diff --git a/.Rbuildignore b/.Rbuildignore index 193cecdbd2..0de63dff4d 100644 --- a/.Rbuildignore +++ b/.Rbuildignore @@ -29,3 +29,5 @@ demo/pandas ^TAGS$ ^\.dir-locals\.el$ ^vignettes/rsconnect$ +^docs$ +^_pkgdown\.yml$ diff --git a/README.md b/README.md index cd53da0f81..e49774106f 100755 --- a/README.md +++ b/README.md @@ -115,13 +115,13 @@ They all work as similarly as possible across the range of data sources. The mai ``` r system.time(carriers_df %>% summarise(delay = mean(arr_delay))) #> user system elapsed -#> 0.053 0.001 0.054 +#> 0.052 0.001 0.053 system.time(carriers_db1 %>% summarise(delay = mean(arr_delay)) %>% collect()) #> user system elapsed -#> 0.233 0.135 0.369 +#> 0.230 0.136 0.372 system.time(carriers_db2 %>% summarise(delay = mean(arr_delay)) %>% collect()) #> user system elapsed -#> 0.010 0.000 0.128 +#> 0.012 0.000 0.198 ``` Data frame methods are much much faster than the plyr equivalent. The database methods are slower, but can work with data that don't fit in memory. @@ -130,7 +130,7 @@ Data frame methods are much much faster than the plyr equivalent. The database m system.time(plyr::ddply(flights, "carrier", plyr::summarise, delay = mean(arr_delay, na.rm = TRUE))) #> user system elapsed -#> 0.118 0.039 0.158 +#> 0.122 0.042 0.165 ``` Multiple table verbs diff --git a/_pkgdown.yml b/_pkgdown.yml new file mode 100644 index 0000000000..e1ef7186fe --- /dev/null +++ b/_pkgdown.yml @@ -0,0 +1,3 @@ +template: + package: tidytemplate + default_assets: false diff --git a/docs/LICENSE b/docs/LICENSE new file mode 100644 index 0000000000..338a6b1173 --- /dev/null +++ b/docs/LICENSE @@ -0,0 +1,2 @@ +YEAR: 2013-2015 +COPYRIGHT HOLDER: RStudio diff --git a/docs/articles/data_frames.html b/docs/articles/data_frames.html new file mode 100644 index 0000000000..e53ebb38b9 --- /dev/null +++ b/docs/articles/data_frames.html @@ -0,0 +1,171 @@ + + +
+ + + + +One of the reasons that dplyr is fast is that it’s very careful about when to make copies. This section describes how this works, and gives you some useful tools for understanding the memory usage of data frames in R.
+The first tool we’ll use is dplyr::location()
. It tells us the memory location of three components of a data frame object:
location(iris)
+#> <0x7f91413bd4e8>
+#> Variables:
+#> * Sepal.Length: <0x7f913d4a1600>
+#> * Sepal.Width: <0x7f913d51e800>
+#> * Petal.Length: <0x7f913d527000>
+#> * Petal.Width: <0x7f913d52ca00>
+#> * Species: <0x7f913b618540>
+#> Attributes:
+#> * names: <0x7f91413bd480>
+#> * row.names: <0x7f913b6139b0>
+#> * class: <0x7f91413cc8f8>
It’s useful to know the memory address, because if the address changes, then you’ll know that R has made a copy. Copies are bad because they take time to create. This isn’t usually a bottleneck if you have a few thousand values, but if you have millions or tens of millions of values it starts to take significant amounts of time. Unnecessary copies are also bad because they take up memory.
+R tries to avoid making copies where possible. For example, if you just assign iris
to another variable, it continues to the point same location:
iris2 <- iris
+location(iris2)
+#> <0x7f91413bd4e8>
+#> Variables:
+#> * Sepal.Length: <0x7f913d4a1600>
+#> * Sepal.Width: <0x7f913d51e800>
+#> * Petal.Length: <0x7f913d527000>
+#> * Petal.Width: <0x7f913d52ca00>
+#> * Species: <0x7f913b618540>
+#> Attributes:
+#> * names: <0x7f91413bd480>
+#> * row.names: <0x7f913b61b240>
+#> * class: <0x7f91413cc8f8>
Rather than having to compare hard to read memory locations, we can instead use the dplyr::changes()
function to highlights changes between two versions of a data frame. The code below shows us that iris
and iris2
are identical: both names point to the same location in memory.
changes(iris2, iris)
+#> <identical>
What do you think happens if you modify a single column of iris2
? In R 3.1.0 and above, R knows to modify only that one column and to leave the others pointing to their existing locations:
iris2$Sepal.Length <- iris2$Sepal.Length * 2
+changes(iris, iris2)
+#> Changed variables:
+#> old new
+#> Sepal.Length 0x7f913d4a1600 0x7f913ca85e00
+#>
+#> Changed attributes:
+#> old new
+#> row.names 0x7f913b5452c0 0x7f913b545540
(This was not the case prior to version 3.1.0, where R created a deep copy of the entire data frame.)
+dplyr is equally smart:
+iris3 <- mutate(iris, Sepal.Length = Sepal.Length * 2)
+changes(iris3, iris)
+#> Changed variables:
+#> old new
+#> Sepal.Length 0x7f913d3be600 0x7f913d4a1600
+#>
+#> Changed attributes:
+#> old new
+#> class 0x7f91411399a8 0x7f91413cc8f8
+#> names 0x7f9141132b48 0x7f91413bd480
+#> row.names 0x7f913b624e60 0x7f913b6250e0
It creates only one new column while all the other columns continue to point at their original locations. You might notice that the attributes are still copied. However, this has little impact on performance. Because attributes are usually short vectors, the internal dplyr code needed to copy them is also considerably simpler.
+dplyr never makes copies unless it has to:
+tbl_df()
and group_by()
don’t copy columns
select()
never copies columns, even when you rename them
mutate()
never copies columns, except when you modify an existing column
arrange()
must always copy all columns because you’re changing the order of every one. This is an expensive operation for big data, but you can generally avoid it using the order argument to window functions
summarise()
creates new data, but it’s usually at least an order of magnitude smaller than the original data.
In short, dplyr lets you work with data frames with very little memory overhead.
+data.table takes this idea one step further: it provides functions that modify a data table in place. This avoids the need to make copies of pointers to existing columns and attributes, and speeds up operations when you have many columns. dplyr doesn’t do this with data frames (although it could) because I think it’s safer to keep data immutable: even if the resulting data frame shares practically all the data of the original data frame, all dplyr data frame methods return a new data frame.
+Consider this call to summarise
:
summarise(per_day, flights = sum(flights))
One of the ways dplyr
achieves dramatic speedups is that expressions might not be evaluated by R, but by alternative code that is faster and uses less memory.
Conceptually the call to summarise
above evaluates the expression sum(flights)
on each subset of flights
controlled by the grouping of per_day
. This involves creating a new R vector to store the chunk and evaluate the R expression.
Evaluating the R expression might carry costs that can be avoided, i.e. S3 dispatch, …
+dplyr
recognizes the expression sum(flights)
as the sum
function applied to a known column of the data, making it possible to handle the dispatch early and once, avoid unneeded memory allocations and compute the result faster.
Hybrid evaluation is able to work on subexpressions. Consider:
+foo <- function(x) x*x
+summarise(per_day, flights = foo(sum(flights)) )
dplyr
will substitute the subexpressions it knows how to handle and leave the rest to standard R evaluation. Instead of evaluating foo(sum(flights))
, R will only have to evaluate foo(z)
where z
is the result of the internal evaluation of sum(flights)
.
Hybrid evaluation is designed to be extensible. Before we start registering custom hybrid evaluation handlers, we need to understand the system.
+The first building block we need to cover is the Result
class.
namespace dplyr {
+ class Result {
+ public:
+ Result(){}
+ virtual ~Result(){} ;
+
+ virtual SEXP process( const GroupedDataFrame& gdf) = 0 ;
+
+ virtual SEXP process( const FullDataFrame& df ) = 0 ;
+
+ virtual SEXP process( const SlicingIndex& index ){
+ return R_NilValue ;
+ }
+
+ } ;
+}
The two first methods deal with grouped and ungrouped data frames. We will mainly focus on the last method that operates on a SlicingIndex
.
SlicingIndex
is a class that encapsulates indices of a single chunk of a grouped data frame.
Hybrid evaluation really just is deriving from the Result
class. Let’s consider a simpler version of sum
that only handles numeric vectors. (The internal version is more complete, handles missing values, …).
class Sum : public Result {
+ public:
+ Sum( NumericVector data_ ): data(data_){}
+
+ SEXP process( const SlicingIndex& index ){
+ double res = 0.0 ;
+ for( int i=0; i<index.size(); i++) res += data[ index[i] ] ;
+ return NumericVector::create( res );
+ }
+
+ virtual SEXP process( const GroupedDataFrame& gdf){
+ ...
+ }
+ virtual SEXP process( const FullDataFrame& df ){
+ ...
+ }
+
+ private:
+ NumericVector data ;
+} ;
Implementation of Result
derived classes can be facilitated by the template class Processor
. Processor
is templated by two template parameters:
REALSXP
, STRSXP
, …)When using Processor
we only have to supply a process_chunk
method that takes a const SlicingIndex&
as input and returns an object suitable to go into a vector of the type controlled by the first template parameter.
The purpose of the Processor
template is then to generate the boiler plate code for the three process
methods defined by the Result
interface.
A possible Sum
implementation would then look something like this:
class Sum : public Processor<REALSXP, Sum> {
+ public:
+ Sum( NumericVector data_ ): data(data_){}
+
+ double process_chunk( const SlicingIndex& index ){
+ double res = 0.0 ;
+ for( int i=0; i<index.size(); i++) res += data[ index[i] ] ;
+ return res;
+ }
+
+ private:
+ NumericVector data ;
+}
Recognizing genericity here, we might want to make Sum
a template class in order to handle more than just numeric vector :
template <int RTYPE>
+class Sum : public Processor<REALSXP, Sum<RTYPE> > {
+ public:
+ typedef typename Rcpp::traits::storage_type<RTYPE>::type STORAGE ;
+
+ Sum( Vector<RTYPE> data_ ): data(data_){}
+
+ STORAGE process_chunk( const SlicingIndex& index ){
+ STORAGE res = 0.0 ;
+ for( int i=0; i<index.size(); i++) res += data[ index[i] ] ;
+ return res;
+ }
+
+ private:
+ Vector<RTYPE> data ;
+}
Aside from not dealing with missing data and using internal knowledge of the SlicingIndex
class, this implementation of Sum
is close to the internal implementation in dplyr
.
dplyr
functions use the get_handler
function to retrieve handlers for particular expressions.
Result* get_handler( SEXP call, const ILazySubsets& subsets ){
+ int depth = Rf_length(call) ;
+ HybridHandlerMap& handlers = get_handlers() ;
+ SEXP fun_symbol = CAR(call) ;
+ if( TYPEOF(fun_symbol) != SYMSXP ) return 0 ;
+
+ HybridHandlerMap::const_iterator it = handlers.find( fun_symbol ) ;
+ if( it == handlers.end() ) return 0 ;
+
+ return it->second( call, subsets, depth - 1 );
+}
The get_handler
performs a lookup in a hash table of type HybridHandlerMap
.
typedef dplyr::Result* (*HybridHandler)(SEXP, const dplyr::ILazySubsets&, int) ;
+typedef dplyr_hash_map<SEXP,HybridHandler> HybridHandlerMap ;
HybridHandlerMap
is simply a hash map where the map key is the symbol of the function and the map value type is a function pointer defined by HybridHandler
.
The parameters of the HybridHandler
function pointer type are:
sum(flights)
+ILazySubsets
reference. The only thing that is relevant about this class here is that it defines a get_variable
method that takes a symbol SEXP
and returns the corresponding variable from the data frame.sum(flights)
, the number of arguments is 1
.The purpose of the hybrid handler function is to return a Result*
if it can handle the call or 0 if it cannot.
with our previous Sum
template class, we could define a hybrid handler function like this:
Result* sum_handler(SEXP call, const ILazySubsets& subsets, int nargs ){
+ // we only know how to deal with argument
+ if( nargs != 1 ) return 0 ;
+
+ // get the first argument
+ SEXP arg = CADR(call) ;
+
+ // if this is a symbol, extract the variable from the subsets
+ if( TYPEOF(arg) == SYMSXP ) arg = subsets.get_variable(arg) ;
+
+ // we know how to handle integer vectors and numeric vectors
+ switch( TYPEOF(arg) ){
+ case INTSXP: return new Sum<INTSXP>(arg) ;
+ case REALSXP: return new Sum<REALSXP>(arg) ;
+ default: break ;
+ }
+
+ // we are here if we could not handle the call
+ return 0 ;
+}
dplyr
enables users, most likely packages, to register their own hybrid handlers through the registerHybridHandler
.
void registerHybridHandler( const char* , HybridHandler ) ;
To register the handler we created above, we then simply:
+registerHybridHandler( "sum", sum_handler ) ;
We are going to register a handler called hitchhiker
that always returns the answer to everything, i.e. 42
.
The code below is suitable to run through sourceCpp
.
#include <dplyr.h>
+// [[Rcpp::depends(dplyr,BH)]]
+
+using namespace dplyr ;
+using namespace Rcpp ;
+
+// the class that derives from Result through Processor
+class Hitchhiker : public Processor<INTSXP,Hitchhiker>{
+public:
+
+ // always returns 42, as it is the answer to everything
+ int process_chunk( const SlicingIndex& ){
+ return 42 ;
+ }
+} ;
+
+// we actually don't need the arguments
+// we can just let this handler return a new Hitchhiker pointer
+Result* hitchhiker_handler( SEXP, const ILazySubsets&, int ){
+ return new Hitchhiker ;
+}
+
+// registration of the register, called from R, so exprted through Rcpp::export
+// [[Rcpp::export]]
+void registerHitchhiker(){
+ registerHybridHandler( "hitchhiker", hitchhiker_handler );
+}
+
+/*** R
+ require(dplyr)
+ registerHitchhiker()
+
+ n <- 10000
+ df <- group_by( tbl_df( data.frame(
+ id = sample( letters[1:4], 1000, replace = TRUE ),
+ x = rnorm(n)
+ ) ), id )
+ summarise( df, y = hitchhiker() )
+ # Source: local data frame [4 x 2]
+ # Groups:
+ #
+ # id y
+ # 1 a 42
+ # 2 b 42
+ # 3 c 42
+ # 4 d 42
+
+ summarise(df, y = mean(x) + hitchhiker())
+ # Source: local data frame [4 x 2]
+ # Groups:
+ #
+ # id y
+ # 1 a 42.00988
+ # 2 b 42.00988
+ # 3 c 42.01440
+ # 4 d 41.99160
+*/
To register custom handlers in packages, the best place is the init
entry point that R automatically calls when a package is loaded.
Instead of exposing the registerHitchhiker
function as above, packages would typically register handlers like this:
#include <Rcpp.h>
+#include <dplyr.h>
+
+// R automatically calls this function when the maypack package is loaded.
+extern "C" void R_init_mypack( DllInfo* info ){
+ registerHybridHandler( "hitchhiker", hitchhiker_handler );
+}
+For this your package must know about Rcpp and dplyr’s headers, which requires this information in the DESCRIPTION
file:
LinkingTo: Rcpp, dplyr, BH
+The Makevars
and Makevars.win
are similar to those used for any package that uses Rcpp
features. See the Rcpp
vignettes for details.
When working with data you must:
+Figure out what you want to do.
Describe those tasks in the form of a computer program.
Execute the program.
The dplyr package makes these steps fast and easy:
+By constraining your options, it simplifies how you can think about common data manipulation tasks.
It provides simple “verbs”, functions that correspond to the most common data manipulation tasks, to help you translate those thoughts into code.
It uses efficient data storage backends, so you spend less time waiting for the computer.
This document introduces you to dplyr’s basic set of tools, and shows you how to apply them to data frames. Other vignettes provide more details on specific topics:
+databases: Besides in-memory data frames, dplyr also connects to out-of-memory, remote databases. And by translating your R code into the appropriate SQL, it allows you to work with both types of data using the same set of tools.
benchmark-baseball: see how dplyr compares to other tools for data manipulation on a realistic use case.
window-functions: a window function is a variation on an aggregation function. Where an aggregate function uses n
inputs to produce 1 output, a window function uses n
inputs to produce n
outputs.
To explore the basic data manipulation verbs of dplyr, we’ll start with the built in nycflights13
data frame. This dataset contains all 336776 flights that departed from New York City in 2013. The data comes from the US Bureau of Transportation Statistics, and is documented in ?nycflights13
library(nycflights13)
+dim(flights)
+#> [1] 336776 19
+head(flights)
+#> # A tibble: 6 × 19
+#> year month day dep_time sched_dep_time dep_delay arr_time
+#> <int> <int> <int> <int> <int> <dbl> <int>
+#> 1 2013 1 1 517 515 2 830
+#> 2 2013 1 1 533 529 4 850
+#> 3 2013 1 1 542 540 2 923
+#> 4 2013 1 1 544 545 -1 1004
+#> # ... with 2 more rows, and 12 more variables: sched_arr_time <int>,
+#> # arr_delay <dbl>, carrier <chr>, flight <int>, tailnum <chr>,
+#> # origin <chr>, dest <chr>, air_time <dbl>, distance <dbl>, hour <dbl>,
+#> # minute <dbl>, time_hour <dttm>
dplyr can work with data frames as is, but if you’re dealing with large data, it’s worthwhile to convert them to a tbl_df
: this is a wrapper around a data frame that won’t accidentally print a lot of data to the screen.
Dplyr aims to provide a function for each basic verb of data manipulation:
+filter()
(and slice()
)arrange()
select()
(and rename()
)distinct()
mutate()
(and transmute()
)summarise()
sample_n()
(and sample_frac()
)If you’ve used plyr before, many of these will be familar.
+filter()
+filter()
allows you to select a subset of rows in a data frame. The first argument is the name of the data frame. The second and subsequent arguments are the expressions that filter the data frame:
For example, we can select all flights on January 1st with:
+filter(flights, month == 1, day == 1)
+#> # A tibble: 842 × 19
+#> year month day dep_time sched_dep_time dep_delay arr_time
+#> <int> <int> <int> <int> <int> <dbl> <int>
+#> 1 2013 1 1 517 515 2 830
+#> 2 2013 1 1 533 529 4 850
+#> 3 2013 1 1 542 540 2 923
+#> 4 2013 1 1 544 545 -1 1004
+#> # ... with 838 more rows, and 12 more variables: sched_arr_time <int>,
+#> # arr_delay <dbl>, carrier <chr>, flight <int>, tailnum <chr>,
+#> # origin <chr>, dest <chr>, air_time <dbl>, distance <dbl>, hour <dbl>,
+#> # minute <dbl>, time_hour <dttm>
This is equivalent to the more verbose code in base R:
+flights[flights$month == 1 & flights$day == 1, ]
filter()
works similarly to subset()
except that you can give it any number of filtering conditions, which are joined together with &
(not &&
which is easy to do accidentally!). You can also use other boolean operators:
filter(flights, month == 1 | month == 2)
To select rows by position, use slice()
:
slice(flights, 1:10)
+#> # A tibble: 10 × 19
+#> year month day dep_time sched_dep_time dep_delay arr_time
+#> <int> <int> <int> <int> <int> <dbl> <int>
+#> 1 2013 1 1 517 515 2 830
+#> 2 2013 1 1 533 529 4 850
+#> 3 2013 1 1 542 540 2 923
+#> 4 2013 1 1 544 545 -1 1004
+#> # ... with 6 more rows, and 12 more variables: sched_arr_time <int>,
+#> # arr_delay <dbl>, carrier <chr>, flight <int>, tailnum <chr>,
+#> # origin <chr>, dest <chr>, air_time <dbl>, distance <dbl>, hour <dbl>,
+#> # minute <dbl>, time_hour <dttm>
arrange()
+arrange()
works similarly to filter()
except that instead of filtering or selecting rows, it reorders them. It takes a data frame, and a set of column names (or more complicated expressions) to order by. If you provide more than one column name, each additional column will be used to break ties in the values of preceding columns:
arrange(flights, year, month, day)
+#> # A tibble: 336,776 × 19
+#> year month day dep_time sched_dep_time dep_delay arr_time
+#> <int> <int> <int> <int> <int> <dbl> <int>
+#> 1 2013 1 1 517 515 2 830
+#> 2 2013 1 1 533 529 4 850
+#> 3 2013 1 1 542 540 2 923
+#> 4 2013 1 1 544 545 -1 1004
+#> # ... with 336,772 more rows, and 12 more variables: sched_arr_time <int>,
+#> # arr_delay <dbl>, carrier <chr>, flight <int>, tailnum <chr>,
+#> # origin <chr>, dest <chr>, air_time <dbl>, distance <dbl>, hour <dbl>,
+#> # minute <dbl>, time_hour <dttm>
Use desc()
to order a column in descending order:
arrange(flights, desc(arr_delay))
+#> # A tibble: 336,776 × 19
+#> year month day dep_time sched_dep_time dep_delay arr_time
+#> <int> <int> <int> <int> <int> <dbl> <int>
+#> 1 2013 1 9 641 900 1301 1242
+#> 2 2013 6 15 1432 1935 1137 1607
+#> 3 2013 1 10 1121 1635 1126 1239
+#> 4 2013 9 20 1139 1845 1014 1457
+#> # ... with 336,772 more rows, and 12 more variables: sched_arr_time <int>,
+#> # arr_delay <dbl>, carrier <chr>, flight <int>, tailnum <chr>,
+#> # origin <chr>, dest <chr>, air_time <dbl>, distance <dbl>, hour <dbl>,
+#> # minute <dbl>, time_hour <dttm>
dplyr::arrange()
works the same way as plyr::arrange()
. It’s a straightforward wrapper around order()
that requires less typing. The previous code is equivalent to:
flights[order(flights$year, flights$month, flights$day), ]
+flights[order(flights$arr_delay, decreasing = TRUE), ] or flights[order(-flights$arr_delay), ]
select()
+Often you work with large datasets with many columns but only a few are actually of interest to you. select()
allows you to rapidly zoom in on a useful subset using operations that usually only work on numeric variable positions:
# Select columns by name
+select(flights, year, month, day)
+#> # A tibble: 336,776 × 3
+#> year month day
+#> <int> <int> <int>
+#> 1 2013 1 1
+#> 2 2013 1 1
+#> 3 2013 1 1
+#> 4 2013 1 1
+#> # ... with 336,772 more rows
+# Select all columns between year and day (inclusive)
+select(flights, year:day)
+#> # A tibble: 336,776 × 3
+#> year month day
+#> <int> <int> <int>
+#> 1 2013 1 1
+#> 2 2013 1 1
+#> 3 2013 1 1
+#> 4 2013 1 1
+#> # ... with 336,772 more rows
+# Select all columns except those from year to day (inclusive)
+select(flights, -(year:day))
+#> # A tibble: 336,776 × 16
+#> dep_time sched_dep_time dep_delay arr_time sched_arr_time arr_delay
+#> <int> <int> <dbl> <int> <int> <dbl>
+#> 1 517 515 2 830 819 11
+#> 2 533 529 4 850 830 20
+#> 3 542 540 2 923 850 33
+#> 4 544 545 -1 1004 1022 -18
+#> # ... with 336,772 more rows, and 10 more variables: carrier <chr>,
+#> # flight <int>, tailnum <chr>, origin <chr>, dest <chr>, air_time <dbl>,
+#> # distance <dbl>, hour <dbl>, minute <dbl>, time_hour <dttm>
This function works similarly to the select
argument in base::subset()
. Because the dplyr philosophy is to have small functions that do one thing well, it’s its own function in dplyr.
There are a number of helper functions you can use within select()
, like starts_with()
, ends_with()
, matches()
and contains()
. These let you quickly match larger blocks of variables that meet some criterion. See ?select
for more details.
You can rename variables with select()
by using named arguments:
select(flights, tail_num = tailnum)
+#> # A tibble: 336,776 × 1
+#> tail_num
+#> <chr>
+#> 1 N14228
+#> 2 N24211
+#> 3 N619AA
+#> 4 N804JB
+#> # ... with 336,772 more rows
But because select()
drops all the variables not explicitly mentioned, it’s not that useful. Instead, use rename()
:
rename(flights, tail_num = tailnum)
+#> # A tibble: 336,776 × 19
+#> year month day dep_time sched_dep_time dep_delay arr_time
+#> <int> <int> <int> <int> <int> <dbl> <int>
+#> 1 2013 1 1 517 515 2 830
+#> 2 2013 1 1 533 529 4 850
+#> 3 2013 1 1 542 540 2 923
+#> 4 2013 1 1 544 545 -1 1004
+#> # ... with 336,772 more rows, and 12 more variables: sched_arr_time <int>,
+#> # arr_delay <dbl>, carrier <chr>, flight <int>, tail_num <chr>,
+#> # origin <chr>, dest <chr>, air_time <dbl>, distance <dbl>, hour <dbl>,
+#> # minute <dbl>, time_hour <dttm>
Use distinct()
to find unique values in a table:
distinct(flights, tailnum)
+#> # A tibble: 4,044 × 1
+#> tailnum
+#> <chr>
+#> 1 N14228
+#> 2 N24211
+#> 3 N619AA
+#> 4 N804JB
+#> # ... with 4,040 more rows
+distinct(flights, origin, dest)
+#> # A tibble: 224 × 2
+#> origin dest
+#> <chr> <chr>
+#> 1 EWR IAH
+#> 2 LGA IAH
+#> 3 JFK MIA
+#> 4 JFK BQN
+#> # ... with 220 more rows
(This is very similar to base::unique()
but should be much faster.)
mutate()
+Besides selecting sets of existing columns, it’s often useful to add new columns that are functions of existing columns. This is the job of mutate()
:
mutate(flights,
+ gain = arr_delay - dep_delay,
+ speed = distance / air_time * 60)
+#> # A tibble: 336,776 × 21
+#> year month day dep_time sched_dep_time dep_delay arr_time
+#> <int> <int> <int> <int> <int> <dbl> <int>
+#> 1 2013 1 1 517 515 2 830
+#> 2 2013 1 1 533 529 4 850
+#> 3 2013 1 1 542 540 2 923
+#> 4 2013 1 1 544 545 -1 1004
+#> # ... with 336,772 more rows, and 14 more variables: sched_arr_time <int>,
+#> # arr_delay <dbl>, carrier <chr>, flight <int>, tailnum <chr>,
+#> # origin <chr>, dest <chr>, air_time <dbl>, distance <dbl>, hour <dbl>,
+#> # minute <dbl>, time_hour <dttm>, gain <dbl>, speed <dbl>
dplyr::mutate()
works the same way as plyr::mutate()
and similarly to base::transform()
. The key difference between mutate()
and transform()
is that mutate allows you to refer to columns that you’ve just created:
mutate(flights,
+ gain = arr_delay - dep_delay,
+ gain_per_hour = gain / (air_time / 60)
+)
+#> # A tibble: 336,776 × 21
+#> year month day dep_time sched_dep_time dep_delay arr_time
+#> <int> <int> <int> <int> <int> <dbl> <int>
+#> 1 2013 1 1 517 515 2 830
+#> 2 2013 1 1 533 529 4 850
+#> 3 2013 1 1 542 540 2 923
+#> 4 2013 1 1 544 545 -1 1004
+#> # ... with 336,772 more rows, and 14 more variables: sched_arr_time <int>,
+#> # arr_delay <dbl>, carrier <chr>, flight <int>, tailnum <chr>,
+#> # origin <chr>, dest <chr>, air_time <dbl>, distance <dbl>, hour <dbl>,
+#> # minute <dbl>, time_hour <dttm>, gain <dbl>, gain_per_hour <dbl>
transform(flights,
+ gain = arr_delay - delay,
+ gain_per_hour = gain / (air_time / 60)
+)
+#> Error: object 'gain' not found
If you only want to keep the new variables, use transmute()
:
transmute(flights,
+ gain = arr_delay - dep_delay,
+ gain_per_hour = gain / (air_time / 60)
+)
+#> # A tibble: 336,776 × 2
+#> gain gain_per_hour
+#> <dbl> <dbl>
+#> 1 9 2.378855
+#> 2 16 4.229075
+#> 3 31 11.625000
+#> 4 -17 -5.573770
+#> # ... with 336,772 more rows
summarise()
+The last verb is summarise()
. It collapses a data frame to a single row (this is exactly equivalent to plyr::summarise()
):
summarise(flights,
+ delay = mean(dep_delay, na.rm = TRUE))
+#> # A tibble: 1 × 1
+#> delay
+#> <dbl>
+#> 1 12.63907
Below, we’ll see how this verb can be very useful.
+sample_n()
and sample_frac()
+You can use sample_n()
and sample_frac()
to take a random sample of rows: use sample_n()
for a fixed number and sample_frac()
for a fixed fraction.
sample_n(flights, 10)
+#> # A tibble: 10 × 19
+#> year month day dep_time sched_dep_time dep_delay arr_time
+#> <int> <int> <int> <int> <int> <dbl> <int>
+#> 1 2013 11 27 1638 1621 17 1911
+#> 2 2013 5 1 1153 1200 -7 1251
+#> 3 2013 5 19 937 940 -3 1045
+#> 4 2013 2 7 1218 1221 -3 1405
+#> # ... with 6 more rows, and 12 more variables: sched_arr_time <int>,
+#> # arr_delay <dbl>, carrier <chr>, flight <int>, tailnum <chr>,
+#> # origin <chr>, dest <chr>, air_time <dbl>, distance <dbl>, hour <dbl>,
+#> # minute <dbl>, time_hour <dttm>
+sample_frac(flights, 0.01)
+#> # A tibble: 3,368 × 19
+#> year month day dep_time sched_dep_time dep_delay arr_time
+#> <int> <int> <int> <int> <int> <dbl> <int>
+#> 1 2013 1 13 1821 1820 1 2007
+#> 2 2013 5 8 1416 1052 204 1727
+#> 3 2013 3 16 1802 1800 2 1927
+#> 4 2013 11 3 1829 1729 60 2047
+#> # ... with 3,364 more rows, and 12 more variables: sched_arr_time <int>,
+#> # arr_delay <dbl>, carrier <chr>, flight <int>, tailnum <chr>,
+#> # origin <chr>, dest <chr>, air_time <dbl>, distance <dbl>, hour <dbl>,
+#> # minute <dbl>, time_hour <dttm>
Use replace = TRUE
to perform a bootstrap sample. If needed, you can weight the sample with the weight
argument.
You may have noticed that the syntax and function of all these verbs are very similar:
+The first argument is a data frame.
The subsequent arguments describe what to do with the data frame. Notice that you can refer to columns in the data frame directly without using $
.
The result is a new data frame
Together these properties make it easy to chain together multiple simple steps to achieve a complex result.
+These five functions provide the basis of a language of data manipulation. At the most basic level, you can only alter a tidy data frame in five useful ways: you can reorder the rows (arrange()
), pick observations and variables of interest (filter()
and select()
), add new variables that are functions of existing variables (mutate()
), or collapse many values to a summary (summarise()
). The remainder of the language comes from applying the five functions to different types of data. For example, I’ll discuss how these functions work with grouped data.
These verbs are useful on their own, but they become really powerful when you apply them to groups of observations within a dataset. In dplyr, you do this with the group_by()
function. It breaks down a dataset into specified groups of rows. When you then apply the verbs above on the resulting object they’ll be automatically applied “by group”. Most importantly, all this is achieved by using the same exact syntax you’d use with an ungrouped object.
Grouping affects the verbs as follows:
+grouped select()
is the same as ungrouped select()
, except that grouping variables are always retained.
grouped arrange()
orders first by the grouping variables
mutate()
and filter()
are most useful in conjunction with window functions (like rank()
, or min(x) == x
). They are described in detail in vignette("window-functions")
.
sample_n()
and sample_frac()
sample the specified number/fraction of rows in each group.
slice()
extracts rows within each group.
summarise()
is powerful and easy to understand, as described in more detail below.
In the following example, we split the complete dataset into individual planes and then summarise each plane by counting the number of flights (count = n()
) and computing the average distance (dist = mean(Distance, na.rm = TRUE)
) and arrival delay (delay = mean(ArrDelay, na.rm = TRUE)
). We then use ggplot2 to display the output.
by_tailnum <- group_by(flights, tailnum)
+delay <- summarise(by_tailnum,
+ count = n(),
+ dist = mean(distance, na.rm = TRUE),
+ delay = mean(arr_delay, na.rm = TRUE))
+delay <- filter(delay, count > 20, dist < 2000)
+
+# Interestingly, the average delay is only slightly related to the
+# average distance flown by a plane.
+ggplot(delay, aes(dist, delay)) +
+ geom_point(aes(size = count), alpha = 1/2) +
+ geom_smooth() +
+ scale_size_area()
You use summarise()
with aggregate functions, which take a vector of values and return a single number. There are many useful examples of such functions in base R like min()
, max()
, mean()
, sum()
, sd()
, median()
, and IQR()
. dplyr provides a handful of others:
n()
: the number of observations in the current group
n_distinct(x)
:the number of unique values in x
.
first(x)
, last(x)
and nth(x, n)
- these work similarly to x[1]
, x[length(x)]
, and x[n]
but give you more control over the result if the value is missing.
For example, we could use these to find the number of planes and the number of flights that go to each possible destination:
+destinations <- group_by(flights, dest)
+summarise(destinations,
+ planes = n_distinct(tailnum),
+ flights = n()
+)
+#> # A tibble: 105 × 3
+#> dest planes flights
+#> <chr> <int> <int>
+#> 1 ABQ 108 254
+#> 2 ACK 58 265
+#> 3 ALB 172 439
+#> 4 ANC 6 8
+#> # ... with 101 more rows
You can also use any function that you write yourself. For performance, dplyr provides optimised C++ versions of many of these functions. If you want to provide your own C++ function, see the hybrid-evaluation vignette for more details.
+When you group by multiple variables, each summary peels off one level of the grouping. That makes it easy to progressively roll-up a dataset:
+daily <- group_by(flights, year, month, day)
+(per_day <- summarise(daily, flights = n()))
+#> Source: local data frame [c(2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013,
+#> 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013,
+#> 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013,
+#> 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013,
+#> 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013) x c(1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 3, 3, 3, 3, 3, 3, 3, 3, 3, 3, 3, 3, 3, 3, 3, 3, 3, 3, 3, 3, 3, 3, 3, 3, 3, 3, 3, 3, 3, 3, 3, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 6, 6, 6, 6, 6, 6, 6, 6, 6, 6, 6, 6, 6, 6, 6, 6,
+#> 6, 6, 6, 6, 6, 6, 6, 6, 6, 6, 6, 6, 6, 6, 7, 7, 7, 7, 7, 7, 7, 7, 7, 7, 7, 7, 7, 7, 7, 7, 7, 7, 7, 7, 7, 7, 7, 7, 7, 7, 7, 7, 7, 7, 7, 8, 8, 8, 8, 8, 8, 8, 8, 8, 8, 8, 8, 8, 8, 8, 8, 8, 8, 8, 8, 8, 8, 8, 8, 8, 8, 8, 8, 8, 8, 8, 9, 9, 9, 9, 9, 9, 9, 9, 9, 9, 9, 9, 9, 9, 9, 9, 9, 9, 9, 9, 9, 9, 9, 9, 9, 9, 9, 9, 9, 9, 10, 10, 10, 10, 10, 10, 10, 10, 10, 10, 10, 10, 10, 10, 10, 10, 10, 10, 10, 10, 10, 10, 10, 10, 10, 10, 10, 10, 10, 10, 10, 11, 11, 11, 11, 11, 11, 11, 11, 11, 11, 11, 11, 11, 11, 11,
+#> 11, 11, 11, 11, 11, 11, 11, 11, 11, 11, 11, 11, 11, 11, 11, 12, 12, 12, 12, 12, 12, 12, 12, 12, 12, 12, 12, 12, 12, 12, 12, 12, 12, 12, 12, 12, 12, 12, 12, 12, 12, 12, 12, 12, 12, 12) x c(1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 22, 23, 24, 25, 26, 27, 28, 29, 30, 31, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 22, 23, 24, 25, 26, 27, 28, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 22, 23, 24, 25, 26, 27, 28, 29, 30, 31, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 22, 23, 24, 25, 26, 27, 28, 29, 30, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16,
+#> 17, 18, 19, 20, 21, 22, 23, 24, 25, 26, 27, 28, 29, 30, 31, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 22, 23, 24, 25, 26, 27, 28, 29, 30, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 22, 23, 24, 25, 26, 27, 28, 29, 30, 31, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 22, 23, 24, 25, 26, 27, 28, 29, 30, 31, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 22, 23, 24, 25, 26, 27, 28,
+#> 29, 30, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 22, 23, 24, 25, 26, 27, 28, 29, 30, 31, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 22, 23, 24, 25, 26, 27, 28, 29, 30, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 22, 23, 24, 25, 26, 27, 28, 29, 30, 31) x c(842, 943, 914, 915, 720, 832, 933, 899, 902, 932, 930, 690, 828, 928, 894, 901, 927, 924, 674, 786, 912, 890, 897, 925, 922, 680, 823, 923, 890, 900, 928, 926, 682, 814, 932, 896, 901, 932, 930, 684, 829, 929, 893, 918, 956, 954, 738, 848, 948, 943, 949, 961, 957, 743, 880, 961, 938, 945, 964, 958, 765, 913, 977, 965, 972, 980, 979, 765, 908, 980, 966, 974, 982, 979, 767, 907, 981, 967, 970, 980, 977, 767, 905, 978, 973, 977, 982, 974, 769, 897, 970, 983, 992, 985, 981, 770, 911, 981, 975, 989,
+#> 992, 989, 770, 917, 995, 974, 988, 992, 988, 766, 919, 985, 965, 976, 983, 981, 757, 913, 983, 960, 964, 983, 978, 745, 912, 980, 955, 965, 981, 978, 738, 896, 979, 955, 967, 982, 980, 749, 911, 983, 962, 972, 988, 978, 728, 729, 928, 981, 974, 989, 986, 754, 911, 982, 960, 970, 976, 975, 779, 908, 987, 980, 983, 989, 989, 801, 918, 990, 982, 985, 995, 993, 812, 923, 994, 993, 995, 995, 994, 812, 918, 966, 945, 983, 737, 822, 805, 934, 1004, 1001, 1004, 1006, 1002, 811, 931, 999, 996, 1001, 1003,
+#> 999, 810, 929, 1000, 997, 1000, 1003, 999, 811, 930, 999, 997, 1001, 1000, 999, 809, 929, 1000, 996, 1001, 1001, 999, 807, 929, 1001, 995, 997, 1000, 998, 780, 914, 996, 986, 990, 990, 989, 774, 903, 982, 965, 973, 979, 965, 680, 718, 929, 956, 948, 969, 967, 688, 908, 991, 961, 947, 992, 996, 686, 900, 992, 961, 972, 992, 994, 693, 904, 993, 960, 976, 996, 996, 682, 914, 993, 965, 975, 995, 995, 687, 917, 994, 964, 974, 994, 991, 676, 902, 987, 963, 974, 995, 993, 684, 915, 991, 964, 975, 992, 989,
+#> 685, 910, 983, 965, 973, 922, 986, 689, 902, 978, 967, 973, 991, 986, 715, 895, 983, 973, 976, 988, 985, 714, 896, 985, 973, 977, 1000, 999, 744, 896, 942, 989, 1014, 634, 661, 857, 987, 1004, 973, 958, 969, 970, 691, 875, 962, 943, 954, 968, 970, 692, 880, 964, 949, 956, 974, 980, 811, 895, 985, 761, 719, 936, 963, 814, 888, 968, 776)]
+#> Groups: year, month [?]
+#>
+#> year month day flights
+#> <int> <int> <int> <int>
+#> 1 2013 1 1 842
+#> 2 2013 1 2 943
+#> 3 2013 1 3 914
+#> 4 2013 1 4 915
+#> # ... with 361 more rows
+(per_month <- summarise(per_day, flights = sum(flights)))
+#> Source: local data frame [c(2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013) x 1:12 x c(27004, 24951, 28834, 28330, 28796, 28243, 29425, 29327, 27574, 28889, 27268, 28135)]
+#> Groups: year [?]
+#>
+#> year month flights
+#> <int> <int> <int>
+#> 1 2013 1 27004
+#> 2 2013 2 24951
+#> 3 2013 3 28834
+#> 4 2013 4 28330
+#> # ... with 8 more rows
+(per_year <- summarise(per_month, flights = sum(flights)))
+#> # A tibble: 1 × 2
+#> year flights
+#> <int> <int>
+#> 1 2013 336776
However you need to be careful when progressively rolling up summaries like this: it’s ok for sums and counts, but you need to think about weighting for means and variances (it’s not possible to do this exactly for medians).
+The dplyr API is functional in the sense that function calls don’t have side-effects. You must always save their results. This doesn’t lead to particularly elegant code, especially if you want to do many operations at once. You either have to do it step-by-step:
+a1 <- group_by(flights, year, month, day)
+a2 <- select(a1, arr_delay, dep_delay)
+a3 <- summarise(a2,
+ arr = mean(arr_delay, na.rm = TRUE),
+ dep = mean(dep_delay, na.rm = TRUE))
+a4 <- filter(a3, arr > 30 | dep > 30)
Or if you don’t want to save the intermediate results, you need to wrap the function calls inside each other:
+filter(
+ summarise(
+ select(
+ group_by(flights, year, month, day),
+ arr_delay, dep_delay
+ ),
+ arr = mean(arr_delay, na.rm = TRUE),
+ dep = mean(dep_delay, na.rm = TRUE)
+ ),
+ arr > 30 | dep > 30
+)
+#> Adding missing grouping variables: `year`, `month`, `day`
+#> Source: local data frame [c(2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013, 2013) x c(1, 1, 2, 2, 3, 3, 4, 4, 4, 4, 4, 4, 5, 5, 5, 6, 6, 6, 6, 6, 6, 6, 6, 6, 6, 7, 7, 7, 7, 7, 7, 7, 7, 8, 8, 8, 8, 8, 9, 9, 10, 10, 12, 12, 12, 12, 12, 12, 12) x c(16, 31, 11, 27, 8, 18, 10, 12, 18, 19, 22, 25, 8, 23, 24, 2, 10, 13, 18, 24, 25, 26, 27, 28, 30, 1, 7, 8, 9, 10, 22, 23, 28, 1, 8, 9, 22, 28, 2, 12, 7, 11, 5, 8, 9, 10, 14, 17, 23) x c(34.2473622508792, 32.602853745541, 36.2900943396226, 31.2524916943522, 85.8621553884712, 41.2918918918919, 38.4123112659698, 36.0481400437637, 36.0284810126582, 47.9116972477064, 37.812166488794, 33.68125, 39.6091825307951, 61.9708994708995, 24.2574152542373, 26.0755176613885, 28.0222929936306, 63.7536889897843, 37.6480263157895, 51.1768082663605, 41.5136842105263, 27.3174097664544, 44.783295711061, 44.9768518518519, 43.5102781136638, 58.2805017103763, 40.3063781321185, 29.6488469601677, 31.3343653250774,
+#> 59.6264775413712, 62.7634032634033, 44.9598214285714, 49.8317757009346, 35.9892588614393, 55.481162540366, 43.3136412459721, 29.9767441860465, 35.2030735455543, 45.5184304399524, 58.9124183006536, 39.017259978425, 18.9229946524064, 51.6662546353523, 36.911801242236, 42.5755555555556, 44.5087956698241, 46.397504456328, 55.8718562874252, 32.2260416666667) x c(24.612865497076, 28.6583629893238, 39.0735981308411, 37.7632743362832, 83.5369211514393, 30.1179596174283, 33.0236753100338, 34.8384279475983, 34.9153605015674, 46.1278280542986, 30.6425531914894, 23.3395638629283, 43.2177777777778, 51.1447196870926, 30.3407172995781, 34.0133657351154, 30.6194503171247, 45.7908277404922, 35.9507658643326, 47.1574178935447, 43.063025210084, 30.6117523609654, 40.8912319644839, 48.8277841561424, 44.1881785283474, 56.2338251986379, 36.6174496644295, 37.2966457023061,
+#> 30.711498973306, 52.8607021517554, 46.6670467502851, 44.7416851441242, 37.7101616628176, 34.574034334764, 43.3499469777306, 34.6918976545842, 33.6004206098843, 40.5268935236004, 53.0295508274232, 49.95875, 39.1467098166127, 31.2318376068376, 52.327990135635, 21.5153374233129, 34.8002207505519, 26.4654939106901, 28.3615520282187, 40.7056019070322, 32.2541493775934)]
+#> Groups: year, month [11]
+#>
+#> year month day arr dep
+#> <int> <int> <int> <dbl> <dbl>
+#> 1 2013 1 16 34.24736 24.61287
+#> 2 2013 1 31 32.60285 28.65836
+#> 3 2013 2 11 36.29009 39.07360
+#> 4 2013 2 27 31.25249 37.76327
+#> # ... with 45 more rows
This is difficult to read because the order of the operations is from inside to out. Thus, the arguments are a long way away from the function. To get around this problem, dplyr provides the %>%
operator. x %>% f(y)
turns into f(x, y)
so you can use it to rewrite multiple operations that you can read left-to-right, top-to-bottom:
As well as data frames, dplyr works with data that is stored in other ways, like data tables, databases and multidimensional arrays.
+dplyr also provides data table methods for all verbs through dtplyr. If you’re using data.tables already this lets you to use dplyr syntax for data manipulation, and data.table for everything else.
+For multiple operations, data.table can be faster because you usually use it with multiple verbs simultaneously. For example, with data table you can do a mutate and a select in a single step. It’s smart enough to know that there’s no point in computing the new variable for rows you’re about to throw away.
+The advantages of using dplyr with data tables are:
+For common data manipulation tasks, it insulates you from the reference semantics of data.tables, and protects you from accidentally modifying your data.
Instead of one complex method built on the subscripting operator ([
), it provides many simple methods.
dplyr also allows you to use the same verbs with a remote database. It takes care of generating the SQL for you so that you can avoid the cognitive challenge of constantly switching between languages. To use these capabilities, you’ll need to install the dbplyr package and then read vignette("dbplyr")
for the details.
tbl_cube()
provides an experimental interface to multidimensional arrays or data cubes. If you’re using this form of data in R, please get in touch so I can better understand your needs.
Compared to all existing options, dplyr:
+abstracts away how your data is stored, so that you can work with data frames, data tables and remote databases using the same set of functions. This lets you focus on what you want to achieve, not on the logistics of data storage.
provides a thoughtful default print()
method that doesn’t automatically print pages of data to the screen (this was inspired by data table’s output).
Compared to base functions:
+dplyr is much more consistent; functions have the same interface. So once you’ve mastered one, you can easily pick up the others
base functions tend to be based around vectors; dplyr is based around data frames
Compared to plyr, dplyr:
+is much much faster
provides a better thought out set of joins
only provides tools for working with data frames (e.g. most of dplyr is equivalent to ddply()
+ various functions, do()
is equivalent to dlply()
)
Compared to virtual data frame approaches:
+it doesn’t pretend that you have a data frame: if you want to run lm etc, you’ll still need to manually pull down the data
it doesn’t provide methods for R summary functions (e.g. mean()
, or sum()
)
Non-standard evaluation is now handled with the tidy evaluation framework. Please see vignette("programming")
.
Most dplyr functions use non-standard evaluation (NSE). This is a catch-all term that means they don’t follow the usual R rules of evaluation. Instead, they capture the expression that you typed and evaluate it in a custom way. This has two main benefits for dplyr code:
+Operations on data frames can be expressed succinctly because you don’t need to repeat the name of the data frame. For example, you can write filter(df, x == 1, y == 2, z == 3)
instead of df[df$x == 1 & df$y ==2 & df$z == 3, ]
.
dplyr can choose to compute results in a different way to base R. This is important for database backends because dplyr itself doesn’t do any work, but instead generates the SQL that tells the database what to do.
Unfortunately these benefits do not come for free. There are two main drawbacks:
+Most dplyr arguments are not referentially transparent. That means you can’t replace a value with a seemingly equivalent object that you’ve defined elsewhere. In other words, this code:
+df <- tibble(x = 1:3, y = 3:1)
+filter(df, x == 1)
+#> # A tibble: 1 × 2
+#> x y
+#> <int> <int>
+#> 1 1 3
Is not equivalent to this code:
+my_var <- x
+#> Error in eval(expr, envir, enclos): object 'x' not found
+filter(df, var == 1)
+#> Error in filter_impl(.data, quo): comparison (1) is possible only for atomic and list types
nor to this code:
+my_var <- "x"
+filter(df, my_var == 1)
+#> # A tibble: 0 × 2
+#> # ... with 2 variables: x <int>, y <int>
This makes it hard to create functions with arguments that change how dplyr verbs are computed.
+dplyr code is ambiguous. Depending on what variables are defined where, filter(df, x == y)
could be equivalent to any of:
df[df$x == df$y, ]
+df[df$x == y, ]
+df[x == df$y, ]
+df[x == y, ]
This is useful when working interactively (because it saves typing and you quickly spot problems) but makes functions more unpredictable than you might desire.
+Fortunately, dplyr provides tools to overcome these challenges. They require a little more typing, but a small amount of upfront work is worth it because they help you save time in the long run.
+This vignette has two goals:
+Show you how to use dplyr’s pronouns and quasiquotation to write reliable functions that reduce duplication in your data analysis code.
To teach you the underlying theory including quosures, the data structure that stores both an expression and an environment, and and tidyeval, the underlying toolkit.
We’ll start with a warmup, tying this problem to something you’re more familiar with, then move on to some practical tools, then dive into the deeper theory.
+You might not have realised it, but you’re already accomplished at solving this type of problem in another domain: strings. It’s obvious that this function doesn’t do what you want:
+greet <- function(name) {
+ "How do you do, name?"
+}
+greet("Hadley")
+#> [1] "How do you do, name?"
That’s because "
“quotes” its input: it doesn’t interpret what you’ve typed, it just stores it in a string. One way to make the function do what you want is to use paste()
to build up the string piece by piece:
greet <- function(name) {
+ paste0("How do you do, ", name, "?")
+}
+greet("Hadley")
+#> [1] "How do you do, Hadley?"
Another approach is exemplified by the glue package: it allows you to “unquote” components of a string, replacing the string, with the value of the R expression. This allows an elegant implementation of our function because {name}
is replaced with the value of the name
argument.
greet <- function(name) {
+ glue::glue("How do you do, {name}?")
+}
+greet("Hadley")
+#> How do you do, Hadley?
The following recipes walk you through the basics of tidyeval, with the nominal goal of reducing duplication in dplyr code. The examples here are somewhat inauthentic because we’ve reduced them down to very simple components to make them easier to understand. They’re so simple that you might wonder why we bother writing a function at all. But it’s a good idea to learn the ideas on simple examples, so that you’re better prepared to apply them to the more complex situations you’ll see in your own code.
+You already know how to write functions that work with the first argument of dplyr verbs: the data. That’s because dplyr doesn’t do anything special with that argument, so it’s referentially transparent. For example, if you saw repeated code like this:
+ +You could already write a function to capture that duplication:
+mutate_y <- function(df) {
+ mutate(df, y = a + x)
+}
Unfortunately, there’s a drawback to this simple approach: it can fail silently if one of the variables isn’t present in the data frame, but is present in the global environment.
+df1 <- tibble(x = 1:3)
+a <- 10
+mutate_y(df1)
+#> # A tibble: 3 × 2
+#> x y
+#> <int> <dbl>
+#> 1 1 11
+#> 2 2 12
+#> 3 3 13
We can fix that ambiguity by being more explicit and using the .data
pronoun. This will throw an informative error if the variable doesn’t exist:
mutate_y <- function(df) {
+ mutate(df, y = .data$a + .data$x)
+}
+
+mutate_y(df1)
+#> Error in mutate_impl(.data, dots): incompatible size (0), expecting 3 (the number of rows) or one
+# Before dplyr is released, this will give a nice error message
If this function is in a package, using .data
also prevents R CMD check
from giving a NOTE about undefined global variables (provided that you’ve also imported rlang::.data
with @importFrom rlang .data
).
Writing a function is hard if you want one of the arguments to be a variable name (like x
) or an expression (like x + y
). That’s because dplyr automatically “quotes” those inputs, so they are not referentially transparent. Let’s start with a simple case: you want to vary the grouping variable for a data summarization.
df <- tibble(
+ g1 = c(1, 1, 2, 2, 2),
+ g2 = c(1, 2, 1, 2, 1),
+ a = sample(5),
+ b = sample(5)
+)
+
+df %>%
+ group_by(g1) %>%
+ summarise(a = mean(a))
+#> # A tibble: 2 × 2
+#> g1 a
+#> <dbl> <dbl>
+#> 1 1 4.000000
+#> 2 2 2.333333
+
+df %>%
+ group_by(g2) %>%
+ summarise(a = mean(a))
+#> # A tibble: 2 × 2
+#> g2 a
+#> <dbl> <dbl>
+#> 1 1 2.0
+#> 2 2 4.5
You might hope that this will work:
+my_summarise <- function(df, group_var) {
+ df %>%
+ group_by(group_var) %>%
+ summarise(a = mean(a))
+}
+
+my_summarise(df, g1)
+#> Error in grouped_df_impl(data, unname(vars), drop): unknown column 'group_var'
But it doesn’t.
+Maybe providing the variable name as a string will fix things?
+my_summarise(df, "g2")
+#> Error in grouped_df_impl(data, unname(vars), drop): unknown column 'group_var'
Nope.
+If you look carefully at the error message, you’ll see that it’s the same in both cases. group_by()
works like to "
: it doesn’t evaluate its input; it quotes it.
To make this function work, we need to do two things. We need to quote the input ourselves (so my_summarise()
can take a bare variable name like group_by
), and then we need to tell group_by()
not to quote its input (because we’ve done the quoting).
How do we quote the input? We can’t use ""
to quote the input, because that gives us a string. Instead we need a function that captures the expression and its environment (we’ll come back to why this is important later on). There are two possible options we could use in base R, the function quote()
and the operator ~
. Neither of these work quite the way we want, so we need a new function: quo()
.
quo()
works like "
: it quotes its input rather than evaluating it.
quo(g1)
+#> ~g1
+#> <environment: 0x7fa6d189eca0>
+quo(a + b + c)
+#> ~a + b + c
+#> <environment: 0x7fa6d189eca0>
+quo("a")
+#> ~"a"
+#> <environment: R_EmptyEnv>
quo()
returns a quosure, which is a special type of formula. You’ll learn more about quosures later on.
Now that we’ve captured this expression, how do we use it with group_by()
? It doesn’t work if we just shove it into our naive approach:
my_summarise(df, quo(g1))
+#> Error in grouped_df_impl(data, unname(vars), drop): unknown column 'group_var'
We get the same error as before, because we haven’t yet told group_by()
that we’re taking care of the quoting. In other words, we need to tell group_by()
not to quote its input, because it has been pre-quoted by my_summarise()
. Yet another way of saying the same thing is that we want to unquotethe
my_var`.
In dplyr (and in the tidyeval in general) you use !!
to say that you want to unquote an input so that it’s evaluated, not quoted. This gives us a funtion that actually does what we want.
my_summarise <- function(df, group_var) {
+ df %>%
+ group_by(!!group_var) %>%
+ summarise(a = mean(a))
+}
+
+my_summarise(df, quo(g1))
+#> # A tibble: 2 × 2
+#> g1 a
+#> <dbl> <dbl>
+#> 1 1 4.000000
+#> 2 2 2.333333
Huzzah!
+There’s just one step left: we want to call this function like we call group_by()
:
my_summarise(df, g1)
This doesn’t work because there’s no object called g1
. We need to capture what the user of the function typed and quote it for them. You might try using quo()
to do that:
my_summarise <- function(df, group_by) {
+ quo_group_by <- quo(group_by)
+ print(quo_group_by)
+
+ df %>%
+ group_by(!!quo_group_by) %>%
+ summarise(a = mean(a))
+}
+
+my_summarise(df, g1)
+#> ~group_by
+#> <environment: 0x7fa6d27db990>
+#> Error in function_list[[i]](value): object 'g1' not found
I’ve added a print()
call to make it obvious what’s going wrong here: quo(group_by)
always returns ~group_by
. It is being too literal! We want it to substitute the value that the user supplied, i.e. to return ~g1
.
By analogy to strings, we don’t want ""
, instead we want some function that turns an argument into a string. That’s the job of enquo()
. enquo()
uses some dark magic too look at the argument, see what the user typed, and return that value as a quosure. (Technically, this works because function arguments are evaluated lazily, using a special data structure called a promise.)
my_summarise <- function(df, group_by) {
+ group_by <- enquo(group_by)
+ print(group_by)
+
+ df %>%
+ group_by(!!group_by) %>%
+ summarise(a = mean(a))
+}
+
+my_summarise(df, g1)
+#> ~g1
+#> <environment: 0x7fa6d189eca0>
+#> # A tibble: 2 × 2
+#> g1 a
+#> <dbl> <dbl>
+#> 1 1 4.000000
+#> 2 2 2.333333
(If you’re familiar with quote()
and substitute()
in base R, quo()
is equivalent to quote()
and enquo()
is equivalent to substitute()
.)
You might wonder how to extend this to handle multiple grouping variables: we’ll come back to that a little later.
+Now let’s tackle something a bit more complicated. The code below shows a duplicate summarise()
statement where we compute three summaries, varying the input variable.
summarise(df, mean = mean(a), sum = sum(a), n = n())
+#> # A tibble: 1 × 3
+#> mean sum n
+#> <dbl> <int> <int>
+#> 1 3 15 5
+summarise(df, mean = mean(a * b), sum = sum(a * b), n = n())
+#> # A tibble: 1 × 3
+#> mean sum n
+#> <dbl> <int> <int>
+#> 1 9.2 46 5
To turn this into a function, we start by testing the basic approach interactively: we quote the variable with quo()
, then unquoting it in the dplyr call with !!
. Notice that we can unquote anywhere inside a complicated expression.
my_var <- quo(a)
+summarise(df, mean = mean(!!my_var), sum = sum(!!my_var), n = n())
+#> # A tibble: 1 × 3
+#> mean sum n
+#> <dbl> <int> <int>
+#> 1 3 15 5
You can also wrap quo()
around the dplyr call to see what will happen from dplyr’s perspective. This is a very useful tool for debugging.
quo(summarise(df,
+ mean = mean(!!my_var),
+ sum = sum(!!my_var),
+ n = n()
+))
+#> ~summarise(df, mean = mean(~a), sum = sum(~a), n = n())
+#> <environment: 0x7fa6d189eca0>
Now we can turn our code into a function (remembering to replace quo()
with enquo()
), and check that it works:
my_summarise2 <- function(df, expr) {
+ expr <- enquo(expr)
+
+ summarise(df,
+ mean = mean(!!expr),
+ sum = sum(!!expr),
+ n = n()
+ )
+}
+my_summarise2(df, a)
+#> # A tibble: 1 × 3
+#> mean sum n
+#> <dbl> <int> <int>
+#> 1 3 15 5
+my_summarise2(df, a * b)
+#> # A tibble: 1 × 3
+#> mean sum n
+#> <dbl> <int> <int>
+#> 1 9.2 46 5
The next challenge is to vary the name of the output variables:
+mutate(df, mean_a = mean(a), sum_a = sum(a))
+#> # A tibble: 5 × 6
+#> g1 g2 a b mean_a sum_a
+#> <dbl> <dbl> <int> <int> <dbl> <int>
+#> 1 1 1 3 3 3 15
+#> 2 1 2 5 2 3 15
+#> 3 2 1 2 5 3 15
+#> 4 2 2 4 4 3 15
+#> # ... with 1 more rows
+mutate(df, mean_b = mean(b), sum_b = sum(b))
+#> # A tibble: 5 × 6
+#> g1 g2 a b mean_b sum_b
+#> <dbl> <dbl> <int> <int> <dbl> <int>
+#> 1 1 1 3 3 3 15
+#> 2 1 2 5 2 3 15
+#> 3 2 1 2 5 3 15
+#> 4 2 2 4 4 3 15
+#> # ... with 1 more rows
This code is similar to the previous example, but there are two new wrinkles:
+We create the new names by pasting together strings, so we need quo_name()
to convert the input expression to a string.
!!mean_name = mean(!!expr)
isn’t valid R code, so we need to use the :=
helper provided by rlang.
my_mutate <- function(df, expr) {
+ expr <- enquo(expr)
+ mean_name <- paste0("mean_", quo_name(expr))
+ sum_name <- paste0("sum_", quo_name(expr))
+
+ mutate(df,
+ !!mean_name := mean(!!expr),
+ !!sum_name := sum(!!expr)
+ )
+}
+
+my_mutate(df, a)
+#> # A tibble: 5 × 6
+#> g1 g2 a b mean_a sum_a
+#> <dbl> <dbl> <int> <int> <dbl> <int>
+#> 1 1 1 3 3 3 15
+#> 2 1 2 5 2 3 15
+#> 3 2 1 2 5 3 15
+#> 4 2 2 4 4 3 15
+#> # ... with 1 more rows
It would be nice to extend my_summarise()
to accept any number of grouping variables. We need to make three changes:
Use ...
in the function definition so our function can accept any number of arguments.
Use quos()
to capture all the ...
as a list of formulas.
Use !!!
instead of !!
to splice the arguments into group_by()
.
my_summarise <- function(df, ...) {
+ group_by <- quos(...)
+
+ df %>%
+ group_by(!!!group_by) %>%
+ summarise(a = mean(a))
+}
+
+my_summarise(df, g1, g2)
+#> Source: local data frame [c(1, 1, 2, 2) x c(1, 2, 1, 2) x c(3, 5, 1.5, 4)]
+#> Groups: g1 [?]
+#>
+#> g1 g2 a
+#> <dbl> <dbl> <dbl>
+#> 1 1 1 3.0
+#> 2 1 2 5.0
+#> 3 2 1 1.5
+#> 4 2 2 4.0
!!!
takes a list of elements and splices them into to the current call. Look at the bottom of the !!!
and think ...
.
args <- list(na.rm = TRUE, trim = 0.25)
+quo(mean(x, !!! args))
+#> ~mean(x, na.rm = TRUE, trim = 0.25)
+#> <environment: 0x7fa6d189eca0>
+
+args <- list(quo(x), na.rm = TRUE, trim = 0.25)
+quo(mean(!!! args))
+#> ~mean(~x, na.rm = TRUE, trim = 0.25)
+#> <environment: 0x7fa6d189eca0>
Now that you’ve learned the basics of tidyeval through some practical examples, we’ll dive into the theory. This will help you generalise what you’ve learned here to new situations.
+Quoting is the action of capturing an expression instead of evaluating it. All expression-based functions quote their arguments and get the R code as an expression rather than the result of evaluating that code. If you are an R user, you probably quote expressions on a regular basis. One of the most important quoting operators in R is the formula. It is famously used for the specification of statistical models:
+disp ~ cyl + drat
+#> disp ~ cyl + drat
+#> <environment: 0x7fa6d189eca0>
The other quoting operator in base R is quote()
. It returns a raw expression rather than a formula:
# Computing the value of the expression:
+toupper(letters[1:5])
+#> [1] "A" "B" "C" "D" "E"
+
+# Capturing the expression:
+quote(toupper(letters[1:5]))
+#> toupper(letters[1:5])
(Note that despite being called the double quote, "
is not a quoting operator in this context, because it generates a string, not an expression.)
In practice, the formula is the better of the two options because captures the code and its execution environment. This important because even simple expression can yield different values in different environments. For example, the x
in the following two expressions refers to different values:
f <- function(x) {
+ ~ x
+}
+
+x1 <- f(10)
+x2 <- f(100)
It might look like the expressions are the same if you print them out. But look carefully at the environments — they’re different.
+x1
+#> ~x
+#> <environment: 0x7fa6d2835238>
+x2
+#> ~x
+#> <environment: 0x7fa6d288c8b0>
When we evaluate those formulas using rlang::eval_tidy()
, we see that they yield different values:
library(rlang)
+
+eval_tidy(x1)
+#> [1] 10
+eval_tidy(x2)
+#> [1] 100
This is a key property of R: one name can refer to different values in different environments. This is also important for dplyr, because it allows you to combine variables and objects in a call:
+user_var <- 1000
+mtcars %>% summarise(cyl = mean(cyl) * user_var)
+#> cyl
+#> 1 6187.5
When an object keep tracks of an environment, it is said to have an enclosure. This is the reason that functions in R are sometimes referred to as closures:
+typeof(mean)
+#> [1] "closure"
For this reason we use a special name to refer to one-sided formulas: quosures. One-sided formulas are quotes (they carry an expression) with an environment.
+Quosures are regular R objects. They can be stored in a variable and inspected:
+var <- ~toupper(letters[1:5])
+var
+#> ~toupper(letters[1:5])
+#> <environment: 0x7fa6d189eca0>
+
+# You can extract its expression:
+get_expr(var)
+#> toupper(letters[1:5])
+
+# Or inspect its enclosure:
+get_env(var)
+#> <environment: 0x7fa6d189eca0>
++Put simply, quasi-quotation enables one to introduce symbols that stand for a linguistic expression in a given instance and are used as that linguistic expression in a different instance. — Willard van Orman Quine
+
Automatic quoting makes dplyr very convenient for interactive use. But if you want to program with dplyr, you need some way to refer to variables indirectly. The solution to this problem is quasiquotation, which allows you to evaluate directly inside an expression that is otherwise quoted.
+Quasiquotation was coined by Willard van Orman Quine in the 1940s, and was adopted for programming by the LISP community in the 1970s. All expression-based functions in the tidyeval framework support quasiquotation. Unquoting cancels quotation of parts of an expression. There are three types of unquoting:
+The first important operation is the basic unquote, which comes in a functional form, UQ()
, and as syntactic-sugar, !!
.
# Here we capture `letters[1:5]` as an expression:
+quo(toupper(letters[1:5]))
+#> ~toupper(letters[1:5])
+#> <environment: 0x7fa6d189eca0>
+
+# Here we capture the value of `letters[1:5]`
+quo(toupper(!!letters[1:5]))
+#> ~toupper(c("a", "b", "c", "d", "e"))
+#> <environment: 0x7fa6d189eca0>
+quo(toupper(UQ(letters[1:5])))
+#> ~toupper(c("a", "b", "c", "d", "e"))
+#> <environment: 0x7fa6d189eca0>
It is also possible to unquote other quoted expressions. Unquoting such symbolic objects provides a powerful a way of manipulating expressions.
+var1 <- quo(letters[1:5])
+quo(toupper(!!var1))
+#> ~toupper(~letters[1:5])
+#> <environment: 0x7fa6d189eca0>
You can safely unquote quosures because they track their environments, and tidyeval functions know how to evaluate them. This allows any depth of quoting and unquoting.
+my_mutate <- function(x) {
+ mtcars %>%
+ select(cyl) %>%
+ slice(1:4) %>%
+ mutate(cyl2 = cyl + (!! x))
+}
+
+f <- function(x) quo(x)
+expr1 <- f(100)
+expr2 <- f(10)
+
+my_mutate(expr1)
+#> # A tibble: 4 × 2
+#> cyl cyl2
+#> <dbl> <dbl>
+#> 1 6 106
+#> 2 6 106
+#> 3 4 104
+#> 4 6 106
+my_mutate(expr2)
+#> # A tibble: 4 × 2
+#> cyl cyl2
+#> <dbl> <dbl>
+#> 1 6 16
+#> 2 6 16
+#> 3 4 14
+#> 4 6 16
The functional form is useful in cases where the precedence of !
causes problems:
my_fun <- quo(fun)
+quo(!!my_fun(x, y, z))
+#> Error in (function (x) : could not find function "my_fun"
+quo(UQ(my_fun)(x, y, z))
+#> ~(~fun)(x, y, z)
+#> <environment: 0x7fa6d189eca0>
+
+my_var <- quo(x)
+quo(filter(df, !!my_var == 1))
+#> ~filter(df, FALSE)
+#> <environment: 0x7fa6d189eca0>
+quo(filter(df, UQ(my_var) == 1))
+#> ~filter(df, (~x) == 1)
+#> <environment: 0x7fa6d189eca0>
You’ll note above that UQ()
yields an quosure containing a formula. That ensures that when the quosure is evaluated, it’ll be looked up in the right environment. In certain code-generation scenarios you just want to use expression and ignore the environment. That’s the job of UQE()
:
quo(UQE(my_fun)(x, y, z))
+#> ~fun(x, y, z)
+#> <environment: 0x7fa6d189eca0>
+quo(filter(df, UQE(my_var) == 1))
+#> ~filter(df, x == 1)
+#> <environment: 0x7fa6d189eca0>
UQE()
is for expert use only as you’ll have to carefully analyse the environments to ensure that the generated code is correct.
The second unquote operation is unquote-splicing. Its functional form is UQS()
and the syntactic shortcut is !!!
. It takes a vector and inserts each element of the vector in the surrounding function call:
quo(list(!!! letters[1:5]))
+#> ~list("a", "b", "c", "d", "e")
+#> <environment: 0x7fa6d189eca0>
A very useful feature of unquote-splicing is that the vector names become argument names:
+x <- list(foo = 1L, bar = quote(baz))
+quo(list(!!! x))
+#> ~list(foo = 1L, bar = baz)
+#> <environment: 0x7fa6d189eca0>
This makes it easy to program with dplyr verbs that take named dots:
+ +The final unquote operation is setting argument names. You’ve seen one way to do that above, but you can also use the definition operator :=
instead of =
. :=
supports supports unquoting on both the LHS and the RHS.
The rules on the LHS are slightly different: the unquoted operand should evaluate to a string or a symbol.
+ +It’s rare that a data analysis involves only a single table of data. In practice, you’ll normally have many tables that contribute to an analysis, and you need flexible tools to combine them. In dplyr, there are three families of verbs that work with two tables at a time:
+Mutating joins, which add new variables to one table from matching rows in another.
Filtering joins, which filter observations from one table based on whether or not they match an observation in the other table.
Set operations, which combine the observations in the data sets as if they were set elements.
(This discussion assumes that you have tidy data, where the rows are observations and the columns are variables. If you’re not familiar with that framework, I’d recommend reading up on it first.)
+All two-table verbs work similarly. The first two arguments are x
and y
, and provide the tables to combine. The output is always a new table with the same type as x
.
Mutating joins allow you to combine variables from multiple tables. For example, take the nycflights13 data. In one table we have flight information with an abbreviation for carrier, and in another we have a mapping between abbreviations and full names. You can use a join to add the carrier names to the flight data:
+library("nycflights13")
+# Drop unimportant variables so it's easier to understand the join results.
+flights2 <- flights %>% select(year:day, hour, origin, dest, tailnum, carrier)
+
+flights2 %>%
+ left_join(airlines)
+#> Joining, by = "carrier"
+#> # A tibble: 336,776 × 9
+#> year month day hour origin dest tailnum carrier
+#> <int> <int> <int> <dbl> <chr> <chr> <chr> <chr>
+#> 1 2013 1 1 5 EWR IAH N14228 UA
+#> 2 2013 1 1 5 LGA IAH N24211 UA
+#> 3 2013 1 1 5 JFK MIA N619AA AA
+#> 4 2013 1 1 5 JFK BQN N804JB B6
+#> 5 2013 1 1 6 LGA ATL N668DN DL
+#> # ... with 3.368e+05 more rows, and 1 more variables: name <chr>
As well as x
and y
, each mutating join takes an argument by
that controls which variables are used to match observations in the two tables. There are a few ways to specify it, as I illustrate below with various tables from nycflights13:
NULL
, the default. dplyr will will use all variables that appear in both tables, a natural join. For example, the flights and weather tables match on their common variables: year, month, day, hour and origin.
flights2 %>% left_join(weather)
+#> Joining, by = c("year", "month", "day", "hour", "origin")
+#> # A tibble: 336,776 × 18
+#> year month day hour origin dest tailnum carrier temp dewp humid
+#> <dbl> <dbl> <int> <dbl> <chr> <chr> <chr> <chr> <dbl> <dbl> <dbl>
+#> 1 2013 1 1 5 EWR IAH N14228 UA NA NA NA
+#> 2 2013 1 1 5 LGA IAH N24211 UA NA NA NA
+#> 3 2013 1 1 5 JFK MIA N619AA AA NA NA NA
+#> 4 2013 1 1 5 JFK BQN N804JB B6 NA NA NA
+#> 5 2013 1 1 6 LGA ATL N668DN DL 39.92 26.06 57.33
+#> # ... with 3.368e+05 more rows, and 7 more variables: wind_dir <dbl>,
+#> # wind_speed <dbl>, wind_gust <dbl>, precip <dbl>, pressure <dbl>,
+#> # visib <dbl>, time_hour <dttm>
A character vector, by = "x"
. Like a natural join, but uses only some of the common variables. For example, flights
and planes
have year
columns, but they mean different things so we only want to join by tailnum
.
flights2 %>% left_join(planes, by = "tailnum")
+#> # A tibble: 336,776 × 16
+#> year.x month day hour origin dest tailnum carrier year.y
+#> <int> <int> <int> <dbl> <chr> <chr> <chr> <chr> <int>
+#> 1 2013 1 1 5 EWR IAH N14228 UA 1999
+#> 2 2013 1 1 5 LGA IAH N24211 UA 1998
+#> 3 2013 1 1 5 JFK MIA N619AA AA 1990
+#> 4 2013 1 1 5 JFK BQN N804JB B6 2012
+#> 5 2013 1 1 6 LGA ATL N668DN DL 1991
+#> # ... with 3.368e+05 more rows, and 7 more variables: type <chr>,
+#> # manufacturer <chr>, model <chr>, engines <int>, seats <int>,
+#> # speed <int>, engine <chr>
Note that the year columns in the output are disambiguated with a suffix.
+A named character vector: by = c("x" = "a")
. This will match variable x
in table x
to variable a
in table b
. The variables from use will be used in the output.
Each flight has an origin and destination airport
, so we need to specify which one we want to join to:
flights2 %>% left_join(airports, c("dest" = "faa"))
+#> # A tibble: 336,776 × 15
+#> year month day hour origin dest tailnum carrier
+#> <int> <int> <int> <dbl> <chr> <chr> <chr> <chr>
+#> 1 2013 1 1 5 EWR IAH N14228 UA
+#> 2 2013 1 1 5 LGA IAH N24211 UA
+#> 3 2013 1 1 5 JFK MIA N619AA AA
+#> 4 2013 1 1 5 JFK BQN N804JB B6
+#> 5 2013 1 1 6 LGA ATL N668DN DL
+#> # ... with 3.368e+05 more rows, and 7 more variables: name <chr>,
+#> # lat <dbl>, lon <dbl>, alt <int>, tz <dbl>, dst <chr>, tzone <chr>
+flights2 %>% left_join(airports, c("origin" = "faa"))
+#> # A tibble: 336,776 × 15
+#> year month day hour origin dest tailnum carrier name
+#> <int> <int> <int> <dbl> <chr> <chr> <chr> <chr> <chr>
+#> 1 2013 1 1 5 EWR IAH N14228 UA Newark Liberty Intl
+#> 2 2013 1 1 5 LGA IAH N24211 UA La Guardia
+#> 3 2013 1 1 5 JFK MIA N619AA AA John F Kennedy Intl
+#> 4 2013 1 1 5 JFK BQN N804JB B6 John F Kennedy Intl
+#> 5 2013 1 1 6 LGA ATL N668DN DL La Guardia
+#> # ... with 3.368e+05 more rows, and 6 more variables: lat <dbl>,
+#> # lon <dbl>, alt <int>, tz <dbl>, dst <chr>, tzone <chr>
There are four types of mutating join, which differ in their behaviour when a match is not found. We’ll illustrate each with a simple example:
+(df1 <- data_frame(x = c(1, 2), y = 2:1))
+#> # A tibble: 2 × 2
+#> x y
+#> <dbl> <int>
+#> 1 1 2
+#> 2 2 1
+(df2 <- data_frame(x = c(1, 3), a = 10, b = "a"))
+#> # A tibble: 2 × 3
+#> x a b
+#> <dbl> <dbl> <chr>
+#> 1 1 10 a
+#> 2 3 10 a
inner_join(x, y)
only includes observations that match in both x
and y
.
df1 %>% inner_join(df2) %>% knitr::kable()
+#> Joining, by = "x"
x | +y | +a | +b | +
---|---|---|---|
1 | +2 | +10 | +a | +
left_join(x, y)
includes all observations in x
, regardless of whether they match or not. This is the most commonly used join because it ensures that you don’t lose observations from your primary table.
df1 %>% left_join(df2)
+#> Joining, by = "x"
+#> # A tibble: 2 × 4
+#> x y a b
+#> <dbl> <int> <dbl> <chr>
+#> 1 1 2 10 a
+#> 2 2 1 NA <NA>
right_join(x, y)
includes all observations in y
. It’s equivalent to left_join(y, x)
, but the columns will be ordered differently.
df1 %>% right_join(df2)
+#> Joining, by = "x"
+#> # A tibble: 2 × 4
+#> x y a b
+#> <dbl> <int> <dbl> <chr>
+#> 1 1 2 10 a
+#> 2 3 NA 10 a
+df2 %>% left_join(df1)
+#> Joining, by = "x"
+#> # A tibble: 2 × 4
+#> x a b y
+#> <dbl> <dbl> <chr> <int>
+#> 1 1 10 a 2
+#> 2 3 10 a NA
full_join()
includes all observations from x
and y
.
df1 %>% full_join(df2)
+#> Joining, by = "x"
+#> # A tibble: 3 × 4
+#> x y a b
+#> <dbl> <int> <dbl> <chr>
+#> 1 1 2 10 a
+#> 2 2 1 NA <NA>
+#> 3 3 NA 10 a
The left, right and full joins are collectively know as outer joins. When a row doesn’t match in an outer join, the new variables are filled in with missing values.
+While mutating joins are primarily used to add new variables, they can also generate new observations. If a match is not unique, a join will add all possible combinations (the Cartesian product) of the matching observations:
+df1 <- data_frame(x = c(1, 1, 2), y = 1:3)
+df2 <- data_frame(x = c(1, 1, 2), z = c("a", "b", "a"))
+
+df1 %>% left_join(df2)
+#> Joining, by = "x"
+#> # A tibble: 5 × 3
+#> x y z
+#> <dbl> <int> <chr>
+#> 1 1 1 a
+#> 2 1 1 b
+#> 3 1 2 a
+#> 4 1 2 b
+#> 5 2 3 a
Filtering joins match obserations in the same way as mutating joins, but affect the observations, not the variables. There are two types:
+semi_join(x, y)
keeps all observations in x
that have a match in y
.anti_join(x, y)
drops all observations in x
that have a match in y
.These are most useful for diagnosing join mismatches. For example, there are many flights in the nycflights13 dataset that don’t have a matching tail number in the planes table:
+library("nycflights13")
+flights %>%
+ anti_join(planes, by = "tailnum") %>%
+ count(tailnum, sort = TRUE)
+#> # A tibble: 722 × 2
+#> tailnum n
+#> <chr> <int>
+#> 1 <NA> 2512
+#> 2 N725MQ 575
+#> 3 N722MQ 513
+#> 4 N723MQ 507
+#> 5 N713MQ 483
+#> # ... with 717 more rows
If you’re worried about what observations your joins will match, start with a semi_join()
or anti_join()
. semi_join()
and anti_join()
never duplicate; they only ever remove observations.
df1 <- data_frame(x = c(1, 1, 3, 4), y = 1:4)
+df2 <- data_frame(x = c(1, 1, 2), z = c("a", "b", "a"))
+
+# Four rows to start with:
+df1 %>% nrow()
+#> [1] 4
+# And we get four rows after the join
+df1 %>% inner_join(df2, by = "x") %>% nrow()
+#> [1] 4
+# But only two rows actually match
+df1 %>% semi_join(df2, by = "x") %>% nrow()
+#> [1] 2
The final type of two-table verb is set operations. These expect the x
and y
inputs to have the same variables, and treat the observations like sets:
intersect(x, y)
: return only observations in both x
and y
+union(x, y)
: return unique observations in x
and y
+setdiff(x, y)
: return observations in x
, but not in y
.Given this simple data:
+(df1 <- data_frame(x = 1:2, y = c(1L, 1L)))
+#> # A tibble: 2 × 2
+#> x y
+#> <int> <int>
+#> 1 1 1
+#> 2 2 1
+(df2 <- data_frame(x = 1:2, y = 1:2))
+#> # A tibble: 2 × 2
+#> x y
+#> <int> <int>
+#> 1 1 1
+#> 2 2 2
The four possibilities are:
+intersect(df1, df2)
+#> # A tibble: 1 × 2
+#> x y
+#> <int> <int>
+#> 1 1 1
+# Note that we get 3 rows, not 4
+union(df1, df2)
+#> # A tibble: 3 × 2
+#> x y
+#> <int> <int>
+#> 1 2 2
+#> 2 2 1
+#> 3 1 1
+setdiff(df1, df2)
+#> # A tibble: 1 × 2
+#> x y
+#> <int> <int>
+#> 1 2 1
+setdiff(df2, df1)
+#> # A tibble: 1 × 2
+#> x y
+#> <int> <int>
+#> 1 2 2
When joining tables, dplyr is a little more conservative than base R about the types of variable that it considers equivalent. This is mostly likely to surprise if you’re working factors:
+Factors with different levels are coerced to character with a warning:
+df1 <- data_frame(x = 1, y = factor("a"))
+df2 <- data_frame(x = 2, y = factor("b"))
+full_join(df1, df2) %>% str()
+#> Joining, by = c("x", "y")
+#> Warning in full_join_impl(x, y, by$x, by$y, suffix$x, suffix$y,
+#> accept_na_match): joining factors with different levels, coercing to
+#> character vector
+#> Classes 'tbl_df', 'tbl' and 'data.frame': 2 obs. of 2 variables:
+#> $ x: num 1 2
+#> $ y: chr "a" "b"
+#> - attr(*, "vars")= chr
Factors with the same levels in a different order are coerced to character with a warning:
+df1 <- data_frame(x = 1, y = factor("a", levels = c("a", "b")))
+df2 <- data_frame(x = 2, y = factor("b", levels = c("b", "a")))
+full_join(df1, df2) %>% str()
+#> Joining, by = c("x", "y")
+#> Warning in full_join_impl(x, y, by$x, by$y, suffix$x, suffix$y,
+#> accept_na_match): joining factors with different levels, coercing to
+#> character vector
+#> Classes 'tbl_df', 'tbl' and 'data.frame': 2 obs. of 2 variables:
+#> $ x: num 1 2
+#> $ y: chr "a" "b"
+#> - attr(*, "vars")= chr
Factors are preserved only if the levels match exactly:
+df1 <- data_frame(x = 1, y = factor("a", levels = c("a", "b")))
+df2 <- data_frame(x = 2, y = factor("b", levels = c("a", "b")))
+full_join(df1, df2) %>% str()
+#> Joining, by = c("x", "y")
+#> Classes 'tbl_df', 'tbl' and 'data.frame': 2 obs. of 2 variables:
+#> $ x: num 1 2
+#> $ y: Factor w/ 2 levels "a","b": 1 2
+#> - attr(*, "vars")= chr
A factor and a character are coerced to character with a warning:
+df1 <- data_frame(x = 1, y = "a")
+df2 <- data_frame(x = 2, y = factor("a"))
+full_join(df1, df2) %>% str()
+#> Joining, by = c("x", "y")
+#> Warning in full_join_impl(x, y, by$x, by$y, suffix$x, suffix$y,
+#> accept_na_match): joining factor and character vector, coercing into
+#> character vector
+#> Classes 'tbl_df', 'tbl' and 'data.frame': 2 obs. of 2 variables:
+#> $ x: num 1 2
+#> $ y: chr "a" "a"
+#> - attr(*, "vars")= chr
Otherwise logicals will be silently upcast to integer, and integer to numeric, but coercing to character will raise an error:
+df1 <- data_frame(x = 1, y = 1L)
+df2 <- data_frame(x = 2, y = 1.5)
+full_join(df1, df2) %>% str()
+#> Joining, by = c("x", "y")
+#> Classes 'tbl_df', 'tbl' and 'data.frame': 2 obs. of 2 variables:
+#> $ x: num 1 2
+#> $ y: num 1 1.5
+#> - attr(*, "vars")= chr
+
+df1 <- data_frame(x = 1, y = 1L)
+df2 <- data_frame(x = 2, y = "a")
+full_join(df1, df2) %>% str()
+#> Joining, by = c("x", "y")
+#> Error in full_join_impl(x, y, by$x, by$y, suffix$x, suffix$y, accept_na_match): Can't join on 'y' x 'y' because of incompatible types (character / integer)
dplyr does not provide any functions for working with three or more tables. Instead use Reduce()
, as described in Advanced R, to iteratively combine the two-table verbs to handle as many tables as you need.
A window function is a variation on an aggregation function. Where an aggregation function, like sum()
and mean()
, takes n inputs and return a single value, a window function returns n values. The output of a window function depends on all its input values, so window functions don’t include functions that work element-wise, like +
or round()
. Window functions include variations on aggregate functions, like cumsum()
and cummean()
, functions for ranking and ordering, like rank()
, and functions for taking offsets, like lead()
and lag()
.
In this vignette, we’ll use a small sample of the Lahman batting dataset, including the players that have won an award.
+library(Lahman)
+
+batting <- Lahman::Batting %>%
+ as_tibble() %>%
+ select(playerID, yearID, teamID, G, AB:H) %>%
+ arrange(playerID, yearID, teamID) %>%
+ semi_join(Lahman::AwardsPlayers, by = "playerID")
+
+players <- batting %>% group_by(playerID)
Window functions are used in conjunction with mutate()
and filter()
to solve a wide range of problems. Here’s a selection:
# For each player, find the two years with most hits
+filter(players, min_rank(desc(H)) <= 2 & H > 0)
+# Within each player, rank each year by the number of games played
+mutate(players, G_rank = min_rank(G))
+
+# For each player, find every year that was better than the previous year
+filter(players, G > lag(G))
+# For each player, compute avg change in games played per year
+mutate(players, G_change = (G - lag(G)) / (yearID - lag(yearID)))
+
+# For each player, find all where they played more games than average
+filter(players, G > mean(G))
+# For each, player compute a z score based on number of games played
+mutate(players, G_z = (G - mean(G)) / sd(G))
Before reading this vignette, you should be familiar with mutate()
and filter()
. If you want to use window functions with SQL databases, you should also be familiar with the basics of dplyr’s SQL translation.
There are five main families of window functions. Two families are unrelated to aggregation functions:
+Ranking and ordering functions: row_number()
, min_rank
(RANK
in SQL), dense_rank()
, cume_dist()
, percent_rank()
, and ntile()
. These functions all take a vector to order by, and return various types of ranks.
Offsets lead()
and lag()
allow you to access the previous and next values in a vector, making it easy to compute differences and trends.
The other three families are variations on familiar aggregate functions:
+Cumulative aggregates: cumsum()
, cummin()
, cummax()
(from base R), and cumall()
, cumany()
, and cummean()
(from dplyr).
Rolling aggregates operate in a fixed width window. You won’t find them in base R or in dplyr, but there are many implementations in other packages, such as RcppRoll.
Recycled aggregates, where an aggregate is repeated to match the length of the input. These are not needed in R because vector recycling automatically recycles aggregates where needed. They are important in SQL, because the presence of an aggregation function usually tells the database to return only one row per group.
Each family is described in more detail below, focussing on the general goals and how to use them with dplyr. For more details, refer to the individual function documentation.
+The ranking functions are variations on a theme, differing in how they handle ties:
+x <- c(1, 1, 2, 2, 2)
+
+row_number(x)
+#> [1] 1 2 3 4 5
+min_rank(x)
+#> [1] 1 1 3 3 3
+dense_rank(x)
+#> [1] 1 1 2 2 2
If you’re familiar with R, you may recognise that row_number()
and min_rank()
can be computed with the base rank()
function and various values of the ties.method
argument. These functions are provided to save a little typing, and to make it easier to convert between R and SQL.
Two other ranking functions return numbers between 0 and 1. percent_rank()
gives the percentage of the rank; cume_dist()
gives the proportion of values less than or equal to the current value.
cume_dist(x)
+#> [1] 0.4 0.4 1.0 1.0 1.0
+percent_rank(x)
+#> [1] 0.0 0.0 0.5 0.5 0.5
These are useful if you want to select (for example) the top 10% of records within each group. For example:
+filter(players, cume_dist(desc(G)) < 0.1)
+#> Source: local data frame [c("bondto01", "hinespa01", "hinespa01", "radboch01", "keefeti01", "clarkjo01", "duffyhu01", "youngcy01", "lajoina01", "lajoina01", "mathech01", "chaseha01", "crigelo01", "sullibi03", "crawfsa01", "walshed01", "donovbi01", "cobbty01", "cobbty01", "wallabo01", "wallabo01", "bresnro01", "klingjo01", "donlimi01", "clarkfr01", "clarkfr01", "brownmo01", "wagneho01", "tennefr02", "eversjo01", "reulbed01", "schulfr01", "collied01", "speaktr01", "speaktr01", "planked01", "johnswa01", "johnswa01", "mullige01",
+#> "woodjo02", "gibsoge01", "adamsba01", "chancfr01", "leachto01", "hofmaso01", "coombja01", "bendech01", "archeji01", "mageesh01", "bakerfr01", "stanaos01", "jacksjo01", "dooinre01", "alexape01", "daubeja01", "doylela01", "loberha01", "marquru01", "mcinnst01", "gardnla01", "ainsmed01", "wagnehe01", "zimmehe01", "paskedo01", "schanwa01", "falkecy01", "barryja01", "cravaga01", "wheatza01", "schalra01", "leonadu01", "maranra01", "wingoiv01", "burnsge01", "grohhe01", "snydefr01", "bancrda01", "mamaual01",
+#> "ruthba01", "ruthba01", "herzobu01", "hornsro01", "hornsro01", "gowdyha01", "roberda01", "cicoted01", "killebi01", "roushed01", "careyma01", "oneilst01", "hoopeha01", "vaughhi01", "grimebu01", "grimebu01", "peckiro01", "stockmi01", "myershy01", "barneje01", "ricesa01", "covelst01", "shockur01", "scottev01", "faberre01", "maysca01", "kellyge01", "bigbeca01", "nehfar01", "duganjo01", "bushjo01", "rommeed01", "rixeyep01", "rixeyep01", "ruethdu01", "heilmha01", "ehmkeho01", "grimmch01", "ofarrbo01",
+#> "ofarrbo01", "luquedo01", "vanceda01", "judgejo01", "judgejo01", "jamiech01", "pennohe01", "jackstr01", "traynpi01", "hartnga01", "bluegos01", "ruelmu01", "cochrmi01", "simmoal01", "simmoal01", "gosligo01", "lyonste01", "lyonste01", "cuyleki01", "bottoji01", "smithea02", "donohpe01", "burnsge02", "kammwi01", "manushe01", "grovele01", "wilsoha01", "lazzeto01", "hoytwa01", "thomato02", "rootch01", "haineje01", "wanerpa01", "wilsoji01", "wanerll01", "wanerll01", "crowdal01", "bentola01", "hafeych01",
+#> "lindsfr01", "fonsele01", "dykesji01", "dykesji01", "combsea01", "earnsge01", "ferrewe01", "kressre01", "lucasre01", "hubbeca01", "odoulle01", "foxxji01", "foxxji01", "averiea01", "cronijo01", "hallabi01", "melilsk01", "walberu01", "branded01", "derripa01", "fitzsfr01", "kleinch01", "gomezle01", "warnelo01", "hermabi01", "clarkwa02", "deandi01", "bartedi01", "dickebi01", "higgipi01", "westsa01", "whiteea01", "bridgto01", "bergewa01", "lopezal01", "medwijo01", "cantwbe01", "werbebi01", "rowesc01",
+#> "ottme01", "ottme01", "moorejo02", "schumha02", "greenha01", "vosmijo01", "foxpe01", "martipe01", "dimagjo01", "kenneve01", "allenjo02", "moseswa01", "applilu01", "hackst01", "suhrgu01", "frencla01", "mizejo01", "ruffire01", "ruffire01", "hemslro01", "hemslro01", "heathje01", "newsobo01", "newsobo01", "vandejo01", "mccorfr01", "lombaer01", "leebi02", "gordojo01", "johnsbo01", "fellebo01", "willite01", "waltebu01", "waltebu01", "daviscu01", "freylo01", "cliftha01", "hayesfr01", "kellech01", "nichobi01",
+#> "milleed03", "leeth01", "travice01", "camildo01", "wyattwh01", "higbeki01", "slaugen01", "slaugen01", "jurgebi01", "keltnke01", "chandsp01", "coopemo01", "marioma01", "owenmi01", "peskyjo01", "troutdi01", "smithal03", "sewelri01", "coopewa01", "coopewa01", "dimagvi01", "stirnsn01", "newhoha01", "elliobo01", "doerrbo01", "gromest01", "cullero01", "cavarph01", "cavarph01", "pafkoan01", "brechha01", "borowha01", "holmeto01", "barrere01", "vernomi01", "vernomi01", "kellge01", "boudrlo01", "polleho01",
+#> "stanked01", "mcculcl01", "ennisde01", "sainjo01", "reesepe01", "dimagdo01", "mcquige02", "reynoal01", "henrito01", "edwarbr01", "blackew01", "kinerra01", "spahnwa01", "spahnwa01", "marshwi01", "tebbebi01", "lemonbo01", "raschvi01", "masiph01", "schmijo01", "darkal01", "michaca01", "wertzvi01", "wertzvi01", "hodgegi01", "gordosi01", "newcodo01", "kindeel01", "rizzuph01", "dropowa01", "houttar01", "konstji01", "furilca01", "snidedu01", "hamnegr01", "dobyla01", "mayswi01", "maglisa01", "roepr01", "shantbo01",
+#> "sauerha01", "roberro01", "roberro01", "martibi02", "gilliji01", "schoere01", "schoere01", "grimbo01", "moonwa01", "kluszte01", "avilabo01", "antonjo02", "podrejo01", "virdobi01", "foxne01", "matheed01", "kalinal01", "kalinal01", "bankser01", "larsedo01", "aparilu01", "robinfr02", "boyerke01", "aaronha01", "aaronha01", "piercbi02", "burdele01", "burdele01", "malzofr01", "lollash01", "minosmi01", "mcmilro01", "sanfoja02", "bunniji01", "howarel01", "turlebo01", "bollifr01", "piersji01", "siebeno01",
+#> "mazerbi01", "crandde01", "haddiha01", "jenseja01", "cepedor01", "thomafr03", "frienbo01", "sherrla01", "wynnea01", "wynnea01", "brandja01", "allisbo01", "mccovwi01", "jonessa02", "lawve01", "robinbr01", "robinbr01", "batteea01", "marisro01", "whitebi03", "hansero02", "skowrbi01", "fornimi01", "mcdanli01", "mcdanli01", "richabo01", "laryfr01", "rosebjo01", "clemero01", "pinsova01", "willsma01", "willibi01", "cashno01", "colavro01", "burgesm01", "jayjo01", "millest01", "wagnele01", "terryra01", "drysddo01",
+#> "kaatji01", "davenji01", "donovdi01", "davisto02", "davisto02", "purkebo01", "facero01", "koufasa01", "yastrca01", "edwarjo01", "floodcu01", "winebo01", "peterga01", "rosepe01", "rosepe01", "pepitjo01", "maricju01", "callijo01", "gibsobo01", "chancde01", "davalvi01", "santoro01", "amaroru01", "olivato01", "allendi01", "stuardi01", "killeha01", "fregoji01", "huntro01", "mcbeaal01", "cardele01", "hallji02", "grantmu01", "stottme01", "johnsde01", "johnsde01", "stargwi01", "stargwi01", "fisheed02", "abernte02",
+#> "ageeto01", "alleyge01", "wilsoea01", "aloufe01", "akerja01", "reganph01", "perezto01", "perezto01", "brocklo01", "lonboji01", "mccormi03", "scottge02", "hundlra01", "carewro01", "seaveto01", "mccarti01", "mccarti01", "wynnji01", "jenkife01", "lolicmi01", "mclaide01", "smithre06", "stanlmi01", "beckegl01", "benchjo01", "bahnsst01", "hortowi01", "hortowi01", "woodwi01", "cuellmi01", "johnsda02", "belanma01", "boyercl02", "pinielo01", "sizemte01", "jacksre01", "jacksre01", "petrori01", "carltst01",
+#> "carltst01", "alouma01", "jonescl01", "perraro01", "clenddo01", "perryji01", "spencji01", "fossera01", "berryke01", "raderdo02", "munsoth01", "mcdowsa01", "merriji01", "bluevi01", "otisam01", "bondsbo01", "daviswi02", "harrebu01", "chambch01", "rojasco01", "murcebo01", "retteme01", "palmeji01", "mayle01", "sanguma01", "sandeke01", "giustda01", "morgajo02", "tenacge01", "perryga01", "perryga01", "fiskca01", "fiskca01", "brinked01", "cedence01", "bowala01", "rudijo01", "scheiri01", "speiech01", "speiech01",
+#> "lylesp01", "carrocl02", "campabe01", "grichbo01", "jorgemi01", "metzgro01", "hillejo01", "bumbral01", "matthga01", "maybejo01", "holtzke01", "evansda01", "russebi01", "marshmi01", "garvest01", "greendi01", "hunteca01", "geronce01", "messean01", "conceda01", "burroje01", "mcbriba01", "schmimi01", "ziskri01", "forstte01", "fingero01", "madlobi01", "tiantlu01", "lynnfr01", "reitzke01", "maddoga01", "nolanga01", "montejo01", "nettlgr01", "nettlgr01", "riceji01", "harrato01", "oliveal01", "parkeda01",
+#> "gossari01", "gossari01", "hraboal01", "rodriau01", "sundbji01", "manniri01", "johnto01", "suttodo01", "suttodo01", "campbbi02", "zachrpa01", "brettge01", "brettge01", "mcraeha01", "tananfr01", "rivermi01", "montawi01", "boonebo01", "griffke01", "griffke01", "beniqju01", "cowenal01", "bakerdu01", "murraed02", "dawsoan01", "randowi01", "hislela01", "ryanno01", "ryanno01", "burleri01", "simmote01", "simmote01", "reuscri01", "reuscri01", "templga01", "milleri01", "lopesda01", "valenel01", "niekrph01",
+#> "niekrph01", "whitalo01", "staubru01", "staubru01", "yountro01", "clarkja01", "flanami01", "suttebr01", "bellbu01", "lezcasi01", "trillma01", "winfida01", "winfida01", "baylodo01", "thornan01", "kernji01", "sutclri01", "porteda02", "singlke01", "smallro02", "kingmda01", "niekrjo01", "niekrjo01", "mcgratu01", "stonest01", "murphdw01", "wilsowi02", "trammal01", "flynndo01", "cartega01", "quiseda01", "howest01", "parrila02", "oglivbe01", "hendrge01", "ceronri01", "bibbyji01", "humeto01", "valenfe01",
+#> "henderi01", "henderi01", "hootobu01", "lansfca01", "armasto01", "guerrpe01", "yeagest01", "vuckope01", "ripkeca01", "saxst01", "garcida01", "decindo01", "durhale01", "robindo01", "zahnge01", "thomago01", "smithlo01", "boddimi01", "dempsri01", "dempsri01", "dennyjo01", "penato01", "mcgeewi01", "knighra01", "kittlro01", "strawda01", "boggswa01", "mosebll01", "rayjo01", "kennete02", "thondi01", "hubbagl01", "mcwilla01", "raineti01", "smithle02", "smithle02", "gibsoki01", "hernawi01", "andujjo01", "gwynnto01",
+#> "rhoderi01", "mattido01", "pettiga01", "wallati01", "reardje01", "guilloz01", "colemvi01", "brookhu01", "baineha01", "baineha01", "herrto01", "tudorjo01", "clemero02", "scottmi03", "gaettga01", "gaettga01", "barfije01", "fernato01", "davisjo02", "leonade01", "worreto01", "cansejo01", "bernato01", "gedmari01", "violafr01", "bedrost01", "langsma01", "pendlte01", "lavalmi01", "daviser01", "molitpa01", "leonaje01", "mcgwima01", "santibe01", "samueju01", "keyji01", "eckerde01", "eckerde01", "steinte01",
+#> "hershor01", "reynoha01", "whitede03", "vanslan01", "oestero01", "francjo01", "francjo01", "weisswa01", "francju01", "francju01", "greenmi01", "galaran01", "bonilbo01", "learyti01", "larkiba01", "whitter01", "stewada01", "clarkwi02", "jacksda02", "mcreyke01", "davisma01", "darliro01", "mitchke01", "russeje01", "olsongr01", "mcgrifr01", "mcgrifr01", "tettlmi01", "sierrru01", "sierrru01", "johnsho01", "dunstsh01", "dunstsh01", "hatchbi01", "drabedo01", "alomasa02", "alomasa02", "burksel01", "griffke02",
+#> "griffke02", "maddugr01", "breamsi01", "myersra01", "justida01", "fieldce01", "willima04", "sciosmi01", "rijojo01", "glavito02", "glavito02", "alomaro01", "pagnoto01", "wegmabi01", "hrbekke01", "averyst01", "knoblch01", "gantro01", "abbotji01", "rodriiv01", "rodriiv01", "gracema01", "walkela01", "smoltjo01", "smoltjo01", "karroer01", "martied01", "gonzaju03", "frymatr01", "sheffga01", "sheffga01", "daultda01", "devermi01", "mcdowja01", "jonesdo01", "bordepa01", "bordepa01", "vizquom01", "vizquom01",
+#> "thompro01", "manwaki01", "grissma02", "olerujo01", "schilcu01", "schilcu01", "montgje01", "salmoti01", "piazzmi01", "baergca01", "stanlmi02", "belleal01", "dykstle01", "coneda01", "lewisda01", "beckro01", "aloumo01", "cordewi01", "coninje01", "johnsra05", "snowjt01", "caminke01", "johnsch04", "finlest01", "mesajo01", "mesajo01", "henketo01", "nomohi01", "ramirma02", "valenjo02", "castivi02", "bicheda01", "thomeji01", "thomeji01", "edmonji01", "mussimi01", "schoupe01", "sandere02", "willibe02", "buhneja01",
+#> "lopezja01", "wettejo01", "brantje01", "hollato01", "younger01", "pettian01", "leiteal01", "martipe02", "hernali01", "hernali01", "rolensc01", "martiti02", "blausje01", "neaglde01", "riverma01", "wellsda01", "wellsda01", "brosisc01", "boonebr01", "jonesan01", "hitchst01", "gordoto01", "gordoto01", "woodke02", "easleda01", "palmede01", "vaughgr01", "brownke01", "greensh01", "liebemi01", "caseyse01", "jonesch06", "perezed02", "wagnebi02", "beltrca01", "willisc01", "alfoned01", "guerrvl01", "hamptmi01",
+#> "moyerja01", "limajo01", "urbinug01", "dyeje01", "rogerke01", "rogerke01", "mathemi01", "giambja01", "giambja01", "jonesto02", "alfonan01", "furcara01", "glaustr01", "posadjo01", "renteed01", "mientdo01", "chaveer01", "camermi01", "hunteto01", "vinafe01", "ausmubr01", "counscr01", "benitar01", "aurilri01", "nenro01", "kennead01", "valenbo02", "molinbe01", "graveda01", "hinsker01", "soriaal01", "anderga01", "beckejo02", "leede02", "castilu01", "cruzjo02", "muellbi02", "wellsve01", "vidrojo01", "lowelmi01",
+#> "wolfra02", "ortizda01", "santajo01", "izturce01", "bayja01", "morame01", "martivi01", "loretma01", "beltrad01", "wilsoja02", "konerpa01", "drewjd01", "nathajo01", "carpech01", "hudsoor01", "varitja01", "oswalro01", "streehu01", "howarry01", "barremi01", "marquja01", "lopezfe01", "damonjo01", "youngmi02", "loducpa01", "polanpl01", "eckstda01", "johnsji04", "grudzma01", "morneju01", "rodrifr03", "verlaju01", "ramirha01", "mauerjo01", "utleych01", "mccanbr01", "zambrca01", "reyesjo01", "berkmla01",
+#> "papeljo01", "penaca01", "youngdm01", "peavyja01", "youklke01", "rowanaa01", "rolliji01", "sweenmi01", "timlimi01", "timlimi01", "putzjj01", "valvejo01", "borowjo01", "garzama01", "hamelco01", "leecl02", "lidgebr01", "gonzaad01", "phillbr01", "molinya01", "mclouna01", "victosh01", "ramirar01", "sotoge01", "huffau01", "ludwiry01", "hillaa01", "greinza01", "zimmery01", "bournmi01", "bellhe01", "frankry01", "hudsoti01", "arroybr01", "tulowtr01", "bautijo02", "rossco01", "wakefti01", "soriara01", "ugglada01",
+#> "youngde03", "cabreme01", "dickera01", "rodnefe01", "hardyjj01", "larocad01", "scutama01", "pierzaj01", "willijo03", "cuddymi01", "youngch03") x c(1880, 1887, 1888, 1883, 1883, 1889, 1898, 1891, 1908, 1910, 1908, 1917, 1905, 1908, 1914, 1908, 1902, 1909, 1915, 1898, 1905, 1908, 1903, 1908, 1908, 1909, 1911, 1915, 1908, 1906, 1908, 1911, 1917, 1912, 1914, 1904, 1915, 1918, 1907, 1922, 1909, 1913, 1906, 1914, 1909, 1908, 1913, 1912, 1915, 1914, 1911, 1916, 1909, 1911, 1922, 1910, 1908, 1911, 1923, 1914, 1917, 1908, 1917, 1911, 1921, 1914, 1910, 1915, 1910, 1920, 1916, 1914, 1917, 1922, 1915, 1915, 1922, 1916, 1924, 1928, 1915, 1927, 1929, 1914,
+#> 1916, 1917, 1917, 1920, 1914, 1920, 1910, 1916, 1920, 1928, 1914, 1920, 1920, 1917, 1917, 1917, 1922, 1917, 1915, 1921, 1920, 1922, 1921, 1924, 1924, 1923, 1920, 1928, 1922, 1924, 1924, 1922, 1923, 1926, 1923, 1928, 1921, 1928, 1923, 1925, 1924, 1931, 1930, 1931, 1924, 1932, 1925, 1932, 1924, 1930, 1933, 1926, 1926, 1925, 1926, 1926, 1928, 1928, 1927, 1930, 1926, 1934, 1926, 1927, 1920, 1927, 1927, 1928, 1931, 1933, 1926, 1933, 1928, 1929, 1921, 1932, 1927, 1930, 1935, 1930, 1931, 1934, 1929, 1932,
+#> 1936, 1937, 1931, 1935, 1932, 1925, 1934, 1936, 1927, 1930, 1931, 1934, 1939, 1930, 1935, 1932, 1937, 1937, 1936, 1927, 1936, 1931, 1934, 1937, 1933, 1934, 1943, 1932, 1934, 1935, 1936, 1938, 1932, 1938, 1933, 1942, 1943, 1936, 1937, 1943, 1939, 1936, 1934, 1940, 1928, 1929, 1934, 1935, 1941, 1934, 1938, 1948, 1939, 1934, 1938, 1941, 1936, 1946, 1947, 1934, 1936, 1939, 1940, 1937, 1944, 1942, 1944, 1944, 1936, 1941, 1939, 1932, 1948, 1942, 1946, 1935, 1939, 1946, 1939, 1941, 1942, 1947, 1944, 1936,
+#> 1939, 1942, 1947, 1943, 1944, 1944, 1943, 1943, 1944, 1944, 1935, 1944, 1952, 1946, 1947, 1944, 1944, 1947, 1952, 1950, 1940, 1946, 1945, 1941, 1949, 1952, 1949, 1948, 1939, 1945, 1946, 1947, 1950, 1948, 1951, 1952, 1947, 1948, 1950, 1949, 1946, 1946, 1951, 1949, 1949, 1950, 1951, 1951, 1959, 1953, 1950, 1953, 1948, 1950, 1951, 1953, 1950, 1954, 1962, 1950, 1944, 1963, 1952, 1954, 1955, 1953, 1962, 1950, 1952, 1957, 1955, 1951, 1952, 1956, 1958, 1962, 1961, 1963, 1956, 1961, 1965, 1962, 1968, 1962,
+#> 1964, 1963, 1968, 1953, 1959, 1966, 1962, 1959, 1960, 1965, 1966, 1957, 1964, 1955, 1958, 1956, 1962, 1967, 1959, 1954, 1958, 1962, 1956, 1956, 1962, 1947, 1948, 1960, 1961, 1965, 1959, 1954, 1961, 1964, 1962, 1961, 1963, 1965, 1961, 1960, 1960, 1965, 1961, 1961, 1966, 1964, 1963, 1962, 1965, 1966, 1961, 1955, 1962, 1963, 1964, 1962, 1965, 1982, 1963, 1956, 1962, 1974, 1957, 1956, 1965, 1969, 1969, 1964, 1970, 1964, 1974, 1979, 1964, 1963, 1964, 1966, 1962, 1964, 1965, 1961, 1964, 1964, 1963, 1967,
+#> 1966, 1971, 1965, 1964, 1963, 1970, 1969, 1965, 1970, 1969, 1973, 1965, 1965, 1966, 1965, 1964, 1968, 1966, 1969, 1968, 1969, 1973, 1966, 1959, 1966, 1968, 1976, 1970, 1964, 1966, 1967, 1966, 1971, 1968, 1971, 1973, 1968, 1974, 1980, 1975, 1979, 1968, 1970, 1973, 1974, 1962, 1972, 1969, 1968, 1975, 1971, 1972, 1973, 1969, 1968, 1969, 1965, 1969, 1976, 1973, 1965, 1970, 1975, 1965, 1969, 1974, 1970, 1973, 1968, 1970, 1978, 1966, 1973, 1971, 1970, 1969, 1977, 1971, 1973, 1971, 1973, 1964, 1965, 1978,
+#> 1985, 1973, 1971, 1974, 1974, 1972, 1971, 1982, 1977, 1966, 1968, 1973, 1975, 1973, 1973, 1980, 1982, 1976, 1973, 1973, 1973, 1974, 1980, 1971, 1970, 1974, 1975, 1974, 1976, 1979, 1974, 1976, 1972, 1977, 1982, 1966, 1978, 1975, 1978, 1970, 1976, 1973, 1978, 1978, 1982, 1980, 1986, 1977, 1980, 1976, 1973, 1975, 1982, 1965, 1967, 1969, 1983, 1984, 1975, 1976, 1977, 1974, 1975, 1978, 1985, 1977, 1978, 1976, 1977, 1973, 1984, 1983, 1979, 1976, 1973, 1974, 1975, 1973, 1975, 1980, 1986, 1978, 1973, 1975,
+#> 1978, 1967, 1978, 1983, 1971, 1978, 1988, 1982, 1991, 1984, 1979, 1976, 1976, 1979, 1980, 1979, 1982, 1979, 1980, 1979, 1973, 1979, 1985, 1975, 1977, 1979, 1980, 1980, 1980, 1982, 1979, 1984, 1985, 1982, 1983, 1982, 1977, 1980, 1974, 1980, 1986, 1980, 1986, 1984, 1979, 1980, 1989, 1975, 1977, 1996, 1988, 1984, 1982, 1985, 1984, 1980, 1980, 1982, 1984, 1978, 1985, 1983, 1983, 1987, 1980, 1983, 1987, 1985, 1984, 1982, 1982, 1983, 1983, 1986, 1984, 1982, 1992, 1985, 1984, 1979, 1986, 1986, 1986, 1986,
+#> 1990, 1982, 1990, 1986, 1985, 1982, 1985, 1985, 1985, 1987, 1986, 1984, 1985, 1987, 1986, 1983, 1978, 1987, 1987, 1985, 1985, 1986, 1983, 1986, 1989, 1987, 1988, 1996, 1989, 1990, 1991, 1985, 1984, 1991, 1992, 1996, 1984, 1991, 1987, 1987, 1983, 1986, 1988, 1993, 1984, 1985, 1990, 1996, 1989, 1987, 1999, 1985, 1983, 1988, 1987, 1986, 1985, 1985, 1989, 1989, 1991, 1989, 1996, 1992, 1989, 1991, 1987, 1986, 1988, 1988, 1989, 1990, 1996, 1996, 1998, 1999, 1991, 1986, 1993, 1993, 1991, 1990, 1987, 1988,
+#> 1988, 1996, 1991, 1991, 1995, 1985, 1998, 1997, 1993, 1991, 1996, 1997, 1999, 1997, 2002, 2004, 1997, 1997, 1992, 1992, 1996, 2003, 1993, 1992, 1991, 1992, 1992, 1993, 1993, 2000, 1986, 1993, 1992, 1999, 1991, 1992, 1990, 2000, 1997, 1992, 1999, 1998, 1993, 1988, 1998, 1998, 1998, 1997, 1993, 1993, 1999, 1989, 1999, 1992, 2002, 2006, 1987, 2002, 2003, 1998, 1998, 1998, 2000, 2003, 1998, 1996, 1993, 2002, 1999, 1993, 2004, 1993, 1991, 1996, 2000, 2006, 1993, 1993, 2002, 2004, 1998, 1999, 1993, 1992,
+#> 2004, 1989, 1990, 1998, 2003, 1999, 1998, 2004, 2005, 2008, 2001, 1996, 1998, 1998, 2000, 1999, 1999, 1998, 2003, 2003, 2002, 2002, 1999, 2002, 1994, 1987, 1997, 1999, 1999, 1989, 1992, 2003, 1999, 2003, 2002, 2004, 2006, 2001, 2000, 2003, 2001, 2005, 2002, 2007, 1998, 2000, 2005, 1999, 2001, 2001, 2000, 1972, 2008, 1999, 2004, 2006, 2001, 2006, 2002, 2003, 2000, 2000, 2003, 2000, 2002, 2010, 2005, 2003, 2004, 2005, 2006, 2013, 2006, 2013, 2005, 2005, 2006, 2003, 2010, 2006, 1999, 2004, 2006, 2008,
+#> 2004, 2006, 2007, 1998, 2006, 2002, 2009, 2005, 2013, 1997, 2008, 2012, 2009, 2006, 2015, 2006, 2008, 2010, 2005, 2004, 2012, 2012, 2003, 2007, 2006, 2007, 2007, 2000, 2004, 2005, 2006, 2011, 2002, 2010, 2008, 2011, 2004, 2008, 2007, 2009, 2008, 2009, 2001, 2008, 2003, 2008, 2007, 2007, 2007, 2009, 2007, 2008, 2001, 2008, 2007, 2010, 2009, 2000, 2009, 2011, 2007, 2015, 2003, 2012, 2013, 2012, 2010, 2006, 2012, 2010, 2015) x c(26, 147, 62, 107, 92, 26, 26, 42, 45, 45, 89, 38, 16, 33, 52, 33, 22, 52, 52, 42, 123, 89, 35, 89, 106, 106, 35, 106, 89, 35, 35, 35, 33, 16, 16, 101, 140, 140, 52, 45, 106, 106, 35, 35, 35, 101, 101, 35, 26, 101, 52, 33, 102, 102, 38, 89, 38, 89, 26, 16, 140, 16, 89, 102, 93, 63, 101, 102, 22, 33, 16, 26, 38, 38, 38, 125, 89, 106, 93, 93, 38, 89, 35, 26, 89, 33, 102, 38, 106, 45, 16, 35, 22, 106, 93, 125, 22, 26, 140, 45, 123, 16, 33, 93, 89, 106, 89, 93, 93, 101, 102, 38, 22, 52, 16, 106, 35,
+#> 125, 38, 22, 140, 140, 45, 93, 89, 106, 35, 140, 140, 101, 101, 101, 140, 33, 33, 106, 125, 106, 38, 45, 33, 123, 101, 35, 93, 106, 33, 35, 125, 106, 102, 106, 106, 140, 26, 38, 89, 45, 101, 101, 93, 101, 16, 123, 38, 89, 102, 101, 16, 45, 140, 125, 123, 101, 26, 38, 89, 102, 93, 35, 35, 22, 125, 102, 93, 16, 123, 52, 52, 26, 22, 125, 26, 16, 102, 89, 89, 89, 89, 52, 45, 52, 125, 93, 45, 45, 101, 33, 35, 106, 106, 125, 16, 16, 123, 123, 45, 123, 123, 38, 38, 38, 35, 93, 101, 45, 16, 102, 102, 125,
+#> 38, 123, 101, 93, 35, 38, 45, 140, 22, 52, 106, 125, 125, 35, 45, 93, 125, 125, 22, 16, 52, 89, 106, 125, 89, 106, 93, 52, 106, 16, 45, 45, 35, 35, 22, 125, 35, 26, 26, 140, 140, 52, 45, 125, 22, 35, 102, 93, 22, 16, 123, 45, 93, 22, 38, 106, 26, 26, 89, 16, 45, 93, 26, 35, 89, 33, 52, 52, 22, 26, 38, 16, 93, 52, 52, 102, 22, 22, 102, 45, 117, 89, 106, 125, 35, 102, 102, 93, 72, 125, 125, 93, 125, 38, 45, 89, 72, 106, 33, 80, 52, 52, 35, 117, 33, 38, 125, 80, 4, 33, 80, 30, 16, 33, 33, 94, 30, 52,
+#> 93, 93, 52, 16, 64, 106, 80, 125, 16, 117, 106, 106, 72, 140, 140, 5, 79, 117, 117, 106, 5, 5, 79, 93, 125, 33, 93, 16, 125, 35, 93, 52, 72, 106, 38, 72, 35, 52, 52, 38, 38, 5, 45, 93, 72, 125, 117, 33, 72, 5, 106, 106, 72, 16, 58, 125, 86, 33, 38, 102, 93, 117, 102, 125, 71, 45, 35, 102, 79, 102, 16, 79, 30, 86, 106, 38, 79, 96, 93, 38, 102, 106, 106, 33, 35, 33, 106, 16, 4, 64, 35, 38, 38, 125, 16, 117, 16, 35, 79, 94, 125, 125, 58, 35, 52, 52, 16, 52, 35, 38, 86, 52, 116, 33, 5, 4, 5, 93, 66,
+#> 72, 96, 96, 16, 102, 102, 106, 94, 79, 106, 79, 33, 96, 33, 58, 93, 45, 38, 96, 66, 117, 72, 94, 93, 102, 93, 5, 5, 38, 96, 83, 106, 58, 96, 117, 117, 16, 33, 52, 58, 102, 96, 66, 117, 86, 93, 4, 96, 5, 86, 58, 52, 5, 102, 66, 96, 4, 72, 72, 72, 96, 96, 38, 72, 38, 131, 102, 102, 106, 33, 114, 106, 45, 16, 125, 102, 38, 117, 93, 93, 16, 45, 131, 38, 106, 93, 125, 52, 131, 45, 33, 72, 72, 35, 72, 66, 66, 66, 30, 30, 94, 30, 38, 38, 131, 66, 4, 5, 86, 93, 79, 30, 30, 16, 125, 125, 35, 106, 125, 16,
+#> 72, 86, 4, 4, 52, 86, 52, 83, 117, 5, 125, 131, 83, 35, 114, 114, 30, 45, 131, 72, 66, 86, 79, 96, 58, 58, 102, 5, 96, 66, 52, 94, 86, 66, 72, 52, 83, 114, 93, 131, 38, 72, 96, 93, 72, 30, 96, 125, 72, 134, 5, 72, 134, 30, 35, 106, 79, 83, 125, 5, 5, 5, 102, 106, 125, 38, 33, 94, 16, 134, 106, 114, 58, 4, 106, 86, 35, 125, 52, 52, 58, 114, 106, 93, 30, 86, 86, 33, 125, 86, 33, 33, 125, 125, 16, 58, 79, 79, 134, 134, 35, 66, 125, 96, 45, 16, 79, 4, 116, 125, 106, 38, 79, 116, 96, 114, 102, 134, 96,
+#> 96, 96, 72, 116, 30, 106, 38, 38, 38, 55, 45, 45, 16, 51, 106, 72, 38, 134, 72, 117, 66, 114, 117, 94, 117, 131, 5, 134, 4, 52, 131, 131, 94, 35, 35, 58, 106, 45, 45, 51, 116, 116, 35, 106, 35, 4, 52, 117, 72, 38, 4, 4, 134, 125, 83, 79, 16, 79, 4, 30, 131, 131, 35, 51, 4, 4, 72, 116, 131, 52, 55, 4, 102, 5, 33, 58, 134, 134, 116, 45, 117, 117, 86, 94, 58, 102, 66, 2, 72, 45, 16, 33, 102, 94, 16, 35, 58, 16, 55, 116, 117, 58, 5, 58, 102, 51, 134, 72, 16, 16, 51, 51, 45, 102, 2, 5, 94, 117, 93, 116,
+#> 5, 86, 117, 72, 35, 58, 134, 72, 117, 86, 102, 93, 4, 106, 93, 134, 134, 93, 116, 4, 114, 93, 93, 35, 52, 131, 114, 114, 72, 102, 38, 4, 78, 58, 66, 38, 94, 86, 58, 35, 58, 86, 66, 131, 131, 125, 96, 93, 51, 4, 72, 2, 93, 125, 79, 96, 116, 79, 78, 52, 3, 94, 117, 117, 2, 72, 117, 38, 134, 137, 2, 16, 55, 55, 134, 117, 134, 86, 55, 78, 16, 79, 72, 106, 5, 52, 16, 131, 106, 33, 72, 117, 125, 3, 16, 58, 96, 102, 35, 125, 137, 66, 131, 72, 52, 125, 5, 86, 79, 78, 52, 55, 79, 102, 4, 35, 94, 58, 102,
+#> 130, 52, 114, 16, 102, 102, 66, 16, 16, 116, 52, 35, 130, 102, 102, 58, 114, 38, 125, 106, 102, 106, 35, 130, 125, 134, 66, 137, 58, 114, 125, 96, 38, 51, 134, 55, 16, 4, 4, 130, 33, 131, 130, 5, 137, 16, 33, 79, 79, 66) x c(76, 123, 133, 89, 70, 73, 152, 55, 157, 159, 56, 152, 109, 137, 157, 66, 48, 156, 156, 154, 156, 140, 132, 155, 151, 152, 53, 156, 156, 154, 46, 154, 156, 153, 158, 46, 64, 65, 70, 142, 150, 43, 136, 153, 153, 78, 48, 120, 156, 150, 141, 155, 141, 50, 156, 151, 155, 45, 154, 155, 125, 153, 150, 153, 134, 49, 145, 150, 156, 151, 48, 156, 121, 156, 160, 144, 156, 45, 153, 154, 155, 155, 156, 128, 150, 49, 125, 149, 156, 149, 155, 44, 43, 48, 157, 155, 154, 53, 155, 46, 48, 157, 50, 51, 155, 150,
+#> 42, 148, 60, 56, 43, 43, 67, 153, 46, 154, 131, 147, 43, 38, 153, 153, 152, 47, 151, 155, 141, 152, 149, 139, 153, 154, 154, 57, 51, 157, 154, 109, 47, 151, 155, 154, 51, 155, 155, 48, 44, 48, 48, 155, 128, 152, 154, 52, 45, 144, 153, 148, 155, 153, 152, 49, 75, 154, 97, 49, 154, 154, 155, 156, 156, 40, 154, 53, 48, 51, 42, 156, 40, 52, 156, 44, 53, 154, 140, 153, 152, 41, 39, 156, 140, 156, 49, 152, 82, 154, 153, 155, 46, 155, 153, 155, 145, 154, 38, 37, 154, 155, 156, 156, 49, 155, 60, 60, 123,
+#> 144, 151, 50, 46, 41, 156, 132, 44, 156, 153, 48, 156, 83, 64, 63, 150, 155, 155, 152, 156, 155, 43, 152, 157, 43, 56, 152, 156, 146, 154, 34, 47, 155, 133, 155, 51, 43, 52, 125, 140, 157, 154, 47, 156, 155, 44, 154, 146, 152, 150, 37, 41, 155, 42, 154, 154, 157, 155, 40, 153, 125, 154, 47, 155, 155, 154, 44, 150, 130, 40, 156, 42, 52, 155, 128, 72, 38, 133, 42, 156, 154, 155, 149, 158, 150, 61, 69, 155, 152, 43, 74, 158, 153, 157, 153, 162, 47, 39, 55, 151, 45, 51, 149, 160, 153, 152, 46, 152, 154,
+#> 150, 49, 42, 156, 159, 158, 153, 153, 163, 52, 157, 162, 162, 161, 160, 42, 52, 54, 156, 140, 154, 157, 50, 45, 150, 36, 154, 155, 162, 163, 150, 61, 154, 162, 157, 49, 58, 54, 73, 145, 159, 160, 50, 50, 163, 163, 148, 161, 162, 162, 150, 70, 65, 71, 162, 42, 142, 155, 162, 165, 164, 160, 163, 116, 39, 71, 163, 43, 58, 62, 147, 44, 163, 158, 48, 69, 43, 162, 151, 162, 159, 54, 163, 163, 160, 42, 162, 46, 50, 150, 164, 135, 161, 162, 157, 163, 162, 152, 62, 163, 156, 72, 39, 159, 159, 145, 148, 82,
+#> 84, 160, 153, 54, 160, 66, 71, 160, 160, 160, 46, 47, 162, 160, 156, 42, 143, 150, 158, 60, 45, 44, 159, 157, 155, 160, 57, 159, 162, 88, 41, 157, 155, 158, 151, 159, 154, 157, 158, 41, 40, 162, 147, 75, 162, 47, 150, 143, 157, 156, 157, 43, 42, 40, 159, 160, 160, 157, 162, 156, 160, 141, 44, 158, 152, 83, 67, 160, 160, 46, 49, 157, 153, 162, 161, 162, 158, 134, 157, 156, 72, 73, 159, 162, 144, 154, 65, 160, 162, 161, 41, 161, 162, 106, 163, 144, 43, 150, 44, 160, 158, 151, 162, 155, 63, 78, 154,
+#> 46, 150, 161, 155, 37, 38, 160, 159, 163, 162, 163, 162, 72, 64, 68, 160, 155, 152, 39, 43, 41, 82, 58, 159, 159, 162, 39, 155, 159, 150, 154, 158, 145, 162, 159, 162, 159, 153, 155, 41, 42, 158, 161, 157, 44, 43, 155, 143, 155, 151, 46, 45, 161, 162, 162, 162, 157, 64, 71, 162, 145, 158, 159, 162, 162, 161, 71, 44, 157, 162, 162, 158, 40, 44, 65, 49, 159, 161, 157, 157, 159, 84, 66, 155, 159, 152, 147, 41, 78, 39, 158, 153, 54, 157, 158, 162, 135, 53, 163, 160, 152, 153, 153, 53, 38, 162, 156, 35,
+#> 136, 132, 36, 151, 153, 162, 145, 154, 161, 158, 162, 153, 154, 148, 50, 160, 72, 70, 154, 80, 46, 160, 41, 162, 154, 161, 75, 160, 154, 156, 161, 160, 159, 37, 36, 38, 162, 160, 159, 163, 151, 40, 75, 159, 153, 144, 37, 70, 37, 162, 121, 135, 161, 150, 156, 152, 161, 63, 67, 69, 145, 45, 161, 159, 157, 157, 74, 70, 158, 160, 160, 159, 159, 163, 39, 161, 139, 46, 162, 36, 158, 77, 42, 154, 71, 72, 161, 159, 157, 162, 161, 157, 150, 155, 145, 40, 132, 127, 156, 161, 160, 39, 154, 74, 157, 162, 159,
+#> 142, 49, 42, 39, 161, 140, 38, 158, 39, 156, 157, 34, 153, 150, 161, 153, 75, 73, 162, 155, 155, 161, 161, 155, 147, 156, 35, 80, 138, 138, 158, 156, 149, 130, 159, 162, 56, 42, 73, 158, 152, 161, 136, 163, 161, 35, 155, 81, 159, 140, 162, 36, 161, 161, 135, 162, 74, 79, 72, 34, 154, 153, 162, 161, 158, 159, 154, 36, 41, 140, 158, 158, 150, 70, 67, 149, 153, 38, 34, 66, 36, 36, 160, 159, 161, 56, 74, 54, 43, 152, 159, 162, 39, 80, 79, 65, 154, 154, 158, 36, 162, 145, 151, 160, 107, 78, 162, 63, 158,
+#> 161, 44, 39, 52, 71, 158, 73, 81, 141, 158, 156, 79, 79, 159, 161, 151, 157, 151, 160, 158, 160, 159, 150, 150, 77, 156, 79, 156, 119, 145, 75, 155, 159, 161, 33, 162, 152, 162, 153, 161, 153, 160, 36, 159, 45, 159, 162, 155, 159, 155, 161, 158, 158, 146, 78, 35, 157, 144, 36, 69, 162, 134, 46, 154, 161, 162, 149, 153, 158, 74, 156, 163, 78, 35, 158, 158, 160, 145, 42, 161, 160, 70, 160, 155, 37, 147, 161, 162, 159, 76, 81, 72, 75, 73, 33, 36, 35, 80, 162, 158, 140, 152, 156, 158, 141, 162, 152,
+#> 160, 52, 162, 157, 81, 74, 36, 40, 155, 161, 151, 52, 77, 161, 162, 158, 38, 76, 159, 154, 150, 140, 145, 157, 34) x c(282, 478, 513, 381, 259, 262, 568, 174, 581, 591, 129, 602, 313, 430, 582, 157, 161, 573, 563, 593, 587, 449, 491, 593, 551, 550, 91, 566, 583, 533, 99, 577, 564, 580, 571, 129, 147, 150, 157, 505, 510, 114, 474, 577, 527, 220, 78, 385, 571, 570, 503, 592, 468, 138, 610, 575, 570, 104, 607, 553, 350, 526, 585, 560, 424, 125, 487, 522, 606, 485, 85, 586, 399, 631, 587, 473, 651, 110, 529, 536, 579, 568, 602, 366, 587, 112, 409, 579, 593, 489, 584, 104, 111, 131, 570, 639, 582, 101, 586, 97, 115,
+#> 528, 84, 143, 590, 614, 89, 610, 124, 101, 101, 104, 125, 570, 126, 593, 452, 492, 104, 96, 622, 542, 644, 99, 596, 615, 508, 570, 501, 518, 654, 670, 579, 122, 91, 614, 603, 329, 106, 603, 552, 638, 80, 585, 589, 56, 86, 122, 108, 623, 443, 659, 681, 102, 78, 568, 646, 566, 613, 558, 648, 114, 150, 614, 153, 117, 638, 585, 585, 609, 611, 56, 612, 64, 96, 90, 87, 648, 83, 113, 623, 68, 128, 614, 530, 570, 533, 78, 118, 617, 439, 633, 85, 623, 120, 566, 582, 681, 74, 556, 621, 634, 599, 610, 52, 87,
+#> 649, 585, 641, 583, 84, 579, 121, 114, 431, 504, 585, 93, 124, 78, 630, 417, 101, 588, 566, 124, 528, 300, 121, 105, 563, 571, 581, 544, 582, 536, 41, 608, 565, 78, 48, 591, 609, 519, 587, 94, 69, 547, 421, 638, 133, 73, 55, 438, 515, 580, 643, 120, 581, 604, 73, 571, 589, 614, 551, 83, 56, 631, 75, 600, 569, 641, 627, 87, 555, 418, 610, 71, 617, 648, 617, 85, 565, 471, 89, 555, 116, 112, 587, 446, 136, 83, 397, 70, 646, 561, 608, 559, 582, 550, 105, 29, 617, 606, 56, 37, 667, 590, 637, 577, 621,
+#> 66, 53, 7, 567, 122, 107, 587, 588, 642, 620, 9, 593, 607, 597, 89, 71, 663, 606, 547, 617, 586, 612, 25, 622, 609, 628, 631, 606, 87, 104, 8, 619, 505, 591, 528, 22, 94, 550, 82, 610, 601, 600, 639, 518, 93, 548, 625, 588, 97, 17, 120, 106, 511, 556, 540, 85, 52, 668, 612, 522, 590, 658, 587, 561, 15, 26, 8, 662, 108, 445, 622, 652, 695, 645, 603, 583, 421, 90, 16, 641, 106, 130, 12, 460, 90, 665, 626, 45, 26, 113, 603, 496, 679, 501, 120, 652, 628, 613, 112, 654, 100, 65, 577, 608, 381, 672, 632,
+#> 612, 547, 611, 520, 27, 597, 497, 9, 101, 616, 574, 522, 522, 29, 18, 629, 500, 73, 662, 21, 15, 625, 629, 650, 54, 66, 601, 553, 605, 95, 465, 543, 594, 51, 115, 111, 618, 602, 643, 621, 9, 615, 646, 22, 112, 559, 493, 566, 574, 590, 553, 593, 553, 117, 100, 698, 509, 24, 612, 93, 518, 492, 472, 576, 597, 95, 77, 0, 620, 643, 643, 564, 625, 626, 616, 491, 113, 607, 571, 14, 13, 583, 510, 56, 64, 571, 543, 515, 611, 669, 593, 450, 601, 530, 0, 30, 642, 581, 445, 580, NA, 645, 616, 594, 0, 595, 615,
+#> 34, 658, 475, 90, 474, 108, 594, 604, 582, 568, 581, 19, 20, 568, 36, 541, 592, 598, 82, 78, 552, 587, 677, 602, 656, 637, 23, 0, 7, 555, 472, 562, 59, 75, 98, 10, 6, 634, 645, 641, NA, 616, 609, 460, 585, 614, 478, 606, 604, 588, 633, 574, 581, 0, NA, 580, 619, 581, 82, 70, 647, 441, 618, 570, 57, 120, 643, 599, 642, 621, 563, 0, 10, 670, 513, 582, 597, 558, 628, 589, 0, 27, 533, 560, 621, 592, 14, 50, 6, 0, 573, 705, 489, 555, 596, NA, 7, 605, 602, 541, 519, NA, 16, 109, 591, 608, 14, 654, 628,
+#> 570, 452, NA, 640, 632, 633, 575, 542, 31, NA, 628, 592, 0, 441, 362, 77, 542, 620, 618, 520, 532, 653, 592, 647, 562, 619, 517, 29, 622, 16, 0, 581, 0, 57, 642, 90, 677, 539, 626, 10, 516, 600, 605, 608, 640, 596, 94, NA, 95, 588, 560, 590, 687, 510, NA, 10, 630, 500, 498, NA, 19, NA, 613, 340, 472, 660, 566, 523, 580, 663, NA, 0, NA, 514, 50, 631, 639, 564, 549, 4, 1, 500, 658, 636, 610, 626, 616, 23, 583, 412, 7, 575, NA, 560, 12, 76, 543, NA, 0, 551, 617, 525, 634, 661, 554, 581, 575, 530, 77,
+#> 445, 418, 613, 633, 606, 88, 522, 2, 585, 624, 617, 461, 37, 60, 76, 637, 459, 0, 593, 1, 611, 606, NA, 639, 597, 593, 568, 2, 2, 628, 542, 584, 659, 519, 576, 510, 653, NA, 4, 480, 488, 560, 613, 549, 432, 653, 581, 3, 64, NA, 568, 556, 657, 427, 609, 637, 80, 585, 1, 584, 570, 595, 0, 570, 585, 426, 607, 0, 1, 0, 63, 569, 588, 645, 662, 557, 578, 599, NA, 32, 505, 591, 563, 579, 4, 3, 478, 607, 62, NA, 4, 64, 81, 601, 589, 597, 11, 0, NA, NA, 530, 622, 592, 50, 1, 0, 0, 585, 582, 573, 82, 610,
+#> 510, 594, 601, 350, 2, 637, 0, 628, 614, 1, 61, 3, 5, 608, NA, NA, 441, 575, 535, 3, 1, 654, 588, 505, 587, 543, 625, 545, 600, 637, 523, 578, 5, 636, 1, 598, 391, 530, 5, 570, 647, 672, 7, 581, 595, 603, 560, 678, 606, 597, 77, 601, 3, 670, 599, 624, 605, 635, 631, 587, 575, 494, 1, 72, 579, 483, 71, 0, 610, 456, 78, 603, 642, 691, 580, 618, 630, 0, 649, 623, 0, 2, 633, 592, 658, 509, 52, 696, 544, 0, 497, 562, 73, 569, 612, 716, 618, 0, 0, 0, 0, 7, 3, 76, 75, 1, 616, 650, 481, 597, 620, 603, 494,
+#> 636, 538, 608, 1, 653, 606, 0, 0, 8, 61, 609, 569, 559, 2, 0, 600, 645, 629, 1, 0, 601, 571, 632, 509, 519, 609, 4) x c(27, 83, 84, 59, 39, 36, 97, 23, 77, 94, 11, 71, 33, 40, 74, 10, 16, 116, 144, 81, 67, 70, 67, 71, 83, 97, 8, 68, 101, 65, 10, 105, 91, 136, 101, 9, 14, 10, 16, 74, 42, 13, 103, 80, 60, 24, 7, 35, 72, 84, 45, 91, 42, 12, 114, 97, 71, 9, 70, 50, 38, 62, 61, 96, 77, 5, 64, 89, 78, 64, 2, 74, 37, 104, 72, 41, 117, 13, 143, 163, 61, 133, 156, 42, 88, 6, 28, 81, 76, 63, 81, 4, 9, 17, 55, 85, 83, 4, 77, 1, 14, 40, 11, 18, 69, 113, 9, 105, 13, 13, 6, 4, 12, 107, 14, 64, 73, 63, 8, 7, 87, 78, 130, 6, 81,
+#> 81, 84, 82, 50, 118, 122, 144, 100, 20, 11, 113, 98, 34, 8, 97, 70, 104, 8, 146, 79, 2, 5, 15, 6, 114, 50, 121, 90, 7, 3, 77, 99, 97, 88, 71, 137, 11, 25, 94, 15, 9, 152, 151, 130, 121, 103, 8, 71, 6, 14, 7, 6, 158, 8, 12, 111, 5, 18, 118, 87, 88, 78, 4, 10, 94, 58, 111, 9, 129, 14, 119, 119, 108, 9, 144, 106, 91, 122, 123, 8, 12, 113, 63, 112, 111, 8, 111, 12, 9, 47, 57, 89, 6, 9, 6, 99, 42, 10, 104, 91, 9, 125, 36, 12, 10, 102, 103, 62, 106, 116, 48, 3, 106, 105, 7, 4, 100, 100, 69, 84, 9, 4, 50,
+#> 53, 106, 18, 11, 5, 58, 79, 64, 125, 10, 82, 78, 11, 98, 85, 106, 76, 2, 5, 93, 5, 77, 71, 114, 97, 2, 128, 41, 92, 4, 132, 127, 101, 1, 92, 53, 7, 104, 8, 10, 102, 54, 21, 7, 52, 3, 114, 73, 96, 99, 118, 96, 10, 3, 125, 61, 2, 0, 93, 132, 78, 94, 130, 3, 4, 0, 89, 11, 12, 72, 83, 81, 91, 1, 86, 74, 102, 7, 5, 82, 67, 82, 96, 116, 79, 3, 55, 134, 100, 121, 84, 4, 14, 0, 74, 63, 89, 44, 1, 10, 63, 7, 91, 91, 114, 62, 65, 16, 83, 105, 69, 7, 0, 6, 9, 73, 83, 93, 3, 10, 89, 82, 58, 132, 106, 61, 76,
+#> 2, 0, 0, 80, 13, 47, 95, 96, 130, 115, 98, 129, 67, 7, 1, 94, 6, 18, 0, 40, 10, 120, 67, 3, 2, 4, 96, 52, 97, 40, 9, 110, 90, 71, 6, 101, 11, 1, 64, 88, 34, 109, 125, 81, 105, 78, 89, 2, 61, 88, 0, 9, 92, 66, 89, 106, 3, 1, 98, 47, 19, 72, 1, 0, 93, 103, 110, 5, 3, 73, 41, 97, 9, 53, 50, 102, 6, 9, 7, 85, 81, 98, 108, 1, 62, 77, 0, 6, 84, 54, 85, 65, 69, 82, 91, 82, 6, 6, 105, 63, 1, 89, 8, 53, 37, 51, 90, 83, 5, 6, 0, 91, 131, 86, 72, 81, 77, 83, 81, 13, 85, 42, 1, 1, 87, 83, 0, 4, 94, 85, 55, 85,
+#> 97, 73, 60, 74, 41, 0, 2, 87, 82, 58, 67, NA, 118, 89, 76, 0, 114, 55, 2, 78, 58, 10, 73, 8, 70, 71, 82, 108, 91, 1, 0, 92, 0, 75, 43, 62, 4, 3, 65, 81, 121, 100, 96, 89, 0, 0, 0, 46, 45, 71, 4, 4, 6, 0, 0, 84, 94, 104, NA, 70, 66, 37, 117, 90, 49, 98, 101, 97, 104, 98, 81, 0, NA, 66, 62, 80, 4, 7, 82, 65, 108, 75, 4, 5, 94, 94, 75, 92, 90, 0, 0, 89, 53, 42, 97, 89, 120, 90, 0, 1, 101, 100, 94, 66, 1, 2, 0, 0, 86, 133, 66, 35, 75, NA, 0, 80, 92, 75, 70, NA, 2, 5, 111, 130, 0, 114, 87, 60, 34, NA,
+#> 94, 70, 79, 94, 58, 6, NA, 78, 120, 1, 41, 54, 7, 51, 76, 71, 75, 108, 107, 97, 79, 75, 81, 65, 2, 106, 2, 0, 96, 0, 3, 107, 9, 117, 93, 69, 0, 61, 94, 67, 89, 86, 97, 9, NA, 7, 55, 71, 89, 91, 56, NA, 0, 81, 73, 66, NA, 0, NA, 83, 33, 81, 99, 69, 87, 60, 101, NA, 0, NA, 79, 4, 95, 103, 93, 63, 0, 0, 50, 82, 97, 71, 119, 96, 1, 108, 55, 0, 102, NA, 89, 0, 9, 100, NA, 0, 98, 81, 82, 101, 110, 93, 66, 69, 79, 1, 60, 53, 142, 120, 123, 8, 73, 0, 90, 102, 87, 44, 2, 6, 8, 88, 38, 0, 78, 2, 117, 113,
+#> NA, 116, 98, 107, 143, 0, 0, 86, 104, 77, 87, 118, 126, 90, 76, NA, 0, 47, 38, 68, 101, 73, 48, 99, 107, 0, 3, NA, 108, 104, 92, 59, 113, 143, 2, 95, 0, 104, 82, 75, 0, 93, 71, 58, 84, 0, 0, 0, 3, 117, 113, 108, 97, 106, 111, 115, NA, 2, 75, 116, 91, 83, 0, 0, 64, 98, 4, NA, 0, 6, 2, 120, 95, 110, 0, 0, NA, NA, 86, 111, 97, 5, 0, 0, 0, 77, 98, 112, 4, 98, 84, 103, 123, 26, 1, 114, 0, 123, 106, 0, 3, 0, 0, 96, NA, NA, 43, 115, 97, 0, 0, 113, 100, 92, 96, 77, 92, 84, 94, 101, 75, 85, 0, 114, 0, 82,
+#> 42, 46, 0, 66, 119, 83, 2, 95, 99, 91, 97, 118, 101, 88, 11, 119, 0, 90, 110, 96, 68, 75, 88, 60, 98, 84, 0, 2, 87, 70, 1, 0, 105, 55, 8, 70, 104, 93, 74, 82, 90, 0, 76, 97, 0, 0, 119, 69, 131, 68, 5, 99, 104, 0, 72, 78, 8, 100, 105, 139, 105, 0, 0, 0, 0, 1, 0, 3, 6, 0, 103, 107, 45, 113, 102, 83, 66, 91, 104, 87, 0, 99, 97, 0, 0, 1, 4, 104, 109, 73, 0, 0, 88, 65, 70, 0, 0, 66, 76, 92, 65, 85, 93, 0) x c(62, 147, 144, 108, 57, 54, 169, 29, 168, 227, 20, 167, 62, 82, 183, 27, 28, 216, 208, 160, 159, 127, 146, 198, 146, 158, 23, 155, 149, 136, 23, 173, 163, 222, 193, 31, 34, 40, 34, 150, 135, 33, 151, 152, 150, 56, 12, 109, 160, 182, 133, 202, 105, 24, 205, 164, 167, 17, 191, 143, 67, 130, 174, 153, 134, 21, 126, 149, 172, 131, 17, 144, 106, 180, 170, 141, 209, 21, 200, 173, 153, 205, 229, 89, 180, 20, 112, 196, 144, 157, 156, 14, 34, 42, 127, 204, 177, 24, 177, 13, 22, 127, 11, 49, 157, 215, 18,
+#> 184, 42, 24, 25, 18, 26, 197, 28, 173, 144, 144, 21, 17, 187, 166, 222, 20, 180, 183, 172, 155, 142, 152, 253, 216, 199, 38, 26, 197, 180, 103, 33, 216, 170, 241, 10, 208, 162, 10, 16, 27, 19, 237, 122, 221, 214, 19, 12, 172, 231, 209, 168, 148, 231, 26, 52, 192, 43, 23, 254, 213, 198, 182, 187, 8, 148, 10, 23, 18, 18, 250, 11, 22, 191, 14, 30, 189, 176, 172, 148, 16, 25, 199, 120, 237, 12, 200, 36, 180, 190, 201, 16, 175, 194, 186, 189, 186, 12, 14, 208, 192, 191, 182, 16, 182, 38, 35, 133, 146,
+#> 199, 17, 31, 11, 209, 127, 20, 162, 165, 16, 181, 78, 29, 40, 150, 175, 144, 159, 167, 112, 5, 218, 164, 15, 10, 188, 183, 125, 191, 14, 16, 138, 109, 207, 36, 10, 11, 123, 157, 144, 205, 29, 183, 163, 19, 162, 162, 197, 158, 11, 7, 195, 13, 159, 143, 218, 185, 14, 143, 95, 184, 19, 172, 185, 195, 8, 142, 139, 13, 147, 22, 18, 171, 125, 37, 13, 106, 9, 196, 173, 185, 172, 156, 158, 32, 11, 200, 150, 11, 4, 197, 198, 172, 157, 189, 8, 7, 1, 153, 15, 27, 151, 159, 177, 188, 1, 175, 157, 179, 14, 9,
+#> 164, 152, 144, 194, 190, 162, 5, 164, 208, 185, 201, 174, 11, 21, 1, 175, 134, 184, 128, 3, 20, 172, 11, 164, 176, 185, 167, 133, 18, 157, 191, 166, 16, 2, 33, 23, 130, 136, 149, 11, 12, 192, 194, 146, 159, 200, 138, 150, 6, 6, 0, 173, 25, 123, 211, 204, 208, 203, 168, 169, 129, 15, 5, 162, 20, 39, 0, 116, 20, 230, 181, 5, 5, 20, 154, 115, 211, 116, 25, 185, 208, 154, 20, 179, 20, 4, 156, 173, 98, 217, 201, 160, 147, 154, 145, 6, 150, 129, 2, 18, 177, 147, 160, 156, 4, 3, 172, 126, 15, 210, 2, 1,
+#> 176, 185, 193, 5, 7, 147, 125, 200, 17, 134, 149, 148, 7, 15, 18, 175, 147, 189, 174, 1, 169, 180, 2, 10, 151, 111, 154, 179, 160, 138, 150, 139, 23, 16, 231, 151, 2, 184, 16, 131, 126, 103, 145, 190, 12, 11, 0, 176, 182, 161, 137, 171, 168, 187, 156, 17, 169, 157, 0, 4, 149, 132, 3, 10, 162, 129, 122, 161, 184, 174, 135, 141, 136, 0, 3, 177, 146, 116, 145, NA, 205, 173, 138, 0, 167, 163, 8, 200, 116, 18, 133, 17, 167, 143, 163, 160, 168, 10, 1, 181, 4, 161, 159, 172, 13, 8, 129, 162, 213, 183, 209,
+#> 174, 5, 0, 0, 123, 94, 152, 10, 10, 15, 1, 2, 195, 215, 191, NA, 175, 156, 114, 186, 177, 122, 189, 174, 180, 189, 155, 158, 0, NA, 146, 192, 193, 13, 11, 181, 115, 162, 165, 7, 27, 206, 186, 175, 190, 154, 0, 0, 200, 146, 139, 184, 154, 186, 161, 0, 4, 155, 169, 168, 141, 3, 7, 1, 0, 157, 230, 126, 135, 175, NA, 0, 163, 147, 168, 144, NA, 3, 24, 179, 160, 1, 188, 175, 177, 103, NA, 178, 175, 180, 173, 153, 9, NA, 150, 182, 0, 114, 92, 13, 163, 177, 163, 132, 151, 240, 166, 182, 166, 177, 136, 4,
+#> 192, 1, 0, 167, 0, 5, 211, 25, 238, 139, 185, 1, 144, 139, 163, 165, 198, 180, 13, NA, 12, 154, 138, 155, 213, 138, NA, 1, 162, 137, 147, NA, 2, NA, 162, 102, 129, 225, 144, 123, 155, 175, NA, 0, NA, 140, 10, 160, 168, 165, 145, 0, 0, 133, 188, 183, 181, 190, 173, 7, 171, 101, 1, 162, NA, 161, 3, 13, 158, NA, 0, 148, 182, 125, 194, 203, 147, 145, 143, 142, 8, 129, 110, 211, 180, 173, 18, 140, 1, 158, 163, 171, 122, 2, 11, 22, 188, 121, 0, 165, 0, 178, 166, NA, 192, 187, 183, 208, 0, 0, 167, 179,
+#> 152, 175, 163, 190, 131, 180, NA, 0, 116, 124, 143, 176, 149, 119, 180, 173, 1, 10, NA, 165, 201, 205, 120, 200, 194, 12, 157, 0, 182, 160, 174, 0, 156, 149, 107, 177, 0, 0, 0, 4, 185, 145, 206, 219, 150, 154, 184, NA, 7, 126, 202, 153, 183, 0, 0, 139, 180, 12, NA, 0, 15, 20, 174, 155, 182, 0, 0, NA, NA, 159, 183, 163, 7, 0, 0, 0, 146, 163, 156, 17, 164, 153, 197, 188, 95, 0, 174, 0, 191, 206, 0, 14, 0, 0, 179, NA, NA, 111, 181, 134, 0, 0, 196, 147, 145, 194, 166, 168, 130, 172, 198, 139, 148, 0,
+#> 206, 0, 159, 107, 155, 0, 140, 179, 194, 3, 157, 187, 146, 150, 215, 200, 165, 19, 180, 1, 193, 183, 171, 182, 181, 199, 151, 163, 140, 0, 8, 166, 130, 10, 0, 153, 131, 14, 148, 178, 217, 163, 176, 185, 0, 177, 187, 0, 0, 185, 157, 203, 153, 12, 190, 172, 0, 98, 167, 17, 159, 189, 212, 206, 0, 0, 0, 0, 2, 0, 17, 15, 0, 172, 187, 141, 165, 181, 181, 141, 198, 161, 177, 0, 174, 173, 0, 0, 0, 12, 177, 148, 151, 0, 0, 140, 186, 172, 1, 0, 158, 155, 174, 150, 135, 165, 2)]
+#> Groups: playerID [906]
+#>
+#> playerID yearID teamID G AB R H
+#> <chr> <int> <fctr> <int> <int> <int> <int>
+#> 1 bondto01 1880 BSN 76 282 27 62
+#> 2 hinespa01 1887 WS8 123 478 83 147
+#> 3 hinespa01 1888 IN3 133 513 84 144
+#> 4 radboch01 1883 PRO 89 381 59 108
+#> # ... with 991 more rows
Finally, ntile()
divides the data up into n
evenly sized buckets. It’s a coarse ranking, and it can be used in with mutate()
to divide the data into buckets for further summary. For example, we could use ntile()
to divide the players within a team into four ranked groups, and calculate the average number of games within each group.
by_team_player <- group_by(batting, teamID, playerID)
+by_team <- summarise(by_team_player, G = sum(G))
+by_team_quartile <- group_by(by_team, quartile = ntile(G, 4))
+summarise(by_team_quartile, mean(G))
+#> # A tibble: 4 × 2
+#> quartile `mean(G)`
+#> <int> <dbl>
+#> 1 1 27.16460
+#> 2 2 97.61757
+#> 3 3 271.80831
+#> 4 4 976.00873
All ranking functions rank from lowest to highest so that small input values get small ranks. Use desc()
to rank from highest to lowest.
lead()
and lag()
produce offset versions of a input vector that is either ahead of or behind the original vector.
You can use them to:
+Compute differences or percent changes.
+ +Using lag()
is more convenient than diff()
because for n
inputs diff()
returns n - 1
outputs.
Find out when a value changes.
+ +lead()
and lag()
have an optional argument order_by
. If set, instead of using the row order to determine which value comes before another, they will use another variable. This important if you have not already sorted the data, or you want to sort one way and lag another.
Here’s a simple example of what happens if you don’t specify order_by
when you need it:
df <- data.frame(year = 2000:2005, value = (0:5) ^ 2)
+scrambled <- df[sample(nrow(df)), ]
+
+wrong <- mutate(scrambled, running = cumsum(value))
+arrange(wrong, year)
+#> year value running
+#> 1 2000 0 39
+#> 2 2001 1 1
+#> 3 2002 4 39
+#> 4 2003 9 35
+#> 5 2004 16 55
+#> 6 2005 25 26
+
+right <- mutate(scrambled, running = order_by(year, cumsum(value)))
+arrange(right, year)
+#> year value running
+#> 1 2000 0 0
+#> 2 2001 1 1
+#> 3 2002 4 5
+#> 4 2003 9 14
+#> 5 2004 16 30
+#> 6 2005 25 55
Base R provides cumulative sum (cumsum()
), cumulative min (cummin()
) and cumulative max (cummax()
). (It also provides cumprod()
but that is rarely useful). Other common accumulating functions are cumany()
and cumall()
, cumulative versions of ||
and &&
, and cummean()
, a cumulative mean. These are not included in base R, but efficient versions are provided by dplyr
.
cumany()
and cumall()
are useful for selecting all rows up to, or all rows after, a condition is true for the first (or last) time. For example, we can use cumany()
to find all records for a player after they played a year with 150 games:
Like lead and lag, you may want to control the order in which the accumulation occurs. None of the built in functions have an order_by
argument so dplyr
provides a helper: order_by()
. You give it the variable you want to order by, and then the call to the window function:
x <- 1:10
+y <- 10:1
+order_by(y, cumsum(x))
+#> [1] 55 54 52 49 45 40 34 27 19 10
This function uses a bit of non-standard evaluation, so I wouldn’t recommend using it inside another function; use the simpler but less concise with_order()
instead.
R’s vector recycling make it easy to select values that are higher or lower than a summary. I call this a recycled aggregate because the value of the aggregate is recycled to be the same length as the original vector. Recycled aggregates are useful if you want to find all records greater than the mean or less than the median:
+ +While most SQL databases don’t have an equivalent of median()
or quantile()
, when filtering you can achieve the same effect with ntile()
. For example, x > median(x)
is equivalent to ntile(x, 2) == 2
; x > quantile(x, 75)
is equivalent to ntile(x, 100) > 75
or ntile(x, 4) > 3
.
You can also use this idea to select the records with the highest (x == max(x)
) or lowest value (x == min(x)
) for a field, but the ranking functions give you more control over ties, and allow you to select any number of records.
Recycled aggregates are also useful in conjunction with mutate()
. For example, with the batting data, we could compute the “career year”, the number of years a player has played since they entered the league:
mutate(players, career_year = yearID - min(yearID) + 1)
+#> Source: local data frame [c("bondto01", "bondto01", "bondto01", "bondto01", "bondto01", "bondto01", "bondto01", "bondto01", "bondto01", "bondto01", "bondto01", "hinespa01", "hinespa01", "hinespa01", "hinespa01", "hinespa01", "hinespa01", "hinespa01", "hinespa01", "hinespa01", "hinespa01", "hinespa01", "hinespa01", "hinespa01", "hinespa01", "hinespa01", "hinespa01", "hinespa01", "hinespa01", "hinespa01", "hinespa01", "hinespa01", "heckegu01", "heckegu01", "heckegu01", "heckegu01", "heckegu01", "heckegu01", "heckegu01", "heckegu01",
+#> "heckegu01", "radboch01", "radboch01", "radboch01", "radboch01", "radboch01", "radboch01", "radboch01", "radboch01", "radboch01", "radboch01", "radboch01", "radboch01", "oneilti01", "oneilti01", "oneilti01", "oneilti01", "oneilti01", "oneilti01", "oneilti01", "oneilti01", "oneilti01", "oneilti01", "keefeti01", "keefeti01", "keefeti01", "keefeti01", "keefeti01", "keefeti01", "keefeti01", "keefeti01", "keefeti01", "keefeti01", "keefeti01", "keefeti01", "keefeti01", "keefeti01", "keefeti01", "clarkjo01",
+#> "clarkjo01", "clarkjo01", "clarkjo01", "clarkjo01", "clarkjo01", "clarkjo01", "clarkjo01", "clarkjo01", "clarkjo01", "clarkjo01", "clarkjo01", "clarkjo01", "rusieam01", "rusieam01", "rusieam01", "rusieam01", "rusieam01", "rusieam01", "rusieam01", "rusieam01", "rusieam01", "rusieam01", "duffyhu01", "duffyhu01", "duffyhu01", "duffyhu01", "duffyhu01", "duffyhu01", "duffyhu01", "duffyhu01", "duffyhu01", "duffyhu01", "duffyhu01", "duffyhu01", "duffyhu01", "duffyhu01", "duffyhu01", "duffyhu01", "duffyhu01",
+#> "youngcy01", "youngcy01", "youngcy01", "youngcy01", "youngcy01", "youngcy01", "youngcy01", "youngcy01", "youngcy01", "youngcy01", "youngcy01", "youngcy01", "youngcy01", "youngcy01", "youngcy01", "youngcy01", "youngcy01", "youngcy01", "youngcy01", "youngcy01", "youngcy01", "youngcy01", "youngcy01", "lajoina01", "lajoina01", "lajoina01", "lajoina01", "lajoina01", "lajoina01", "lajoina01", "lajoina01", "lajoina01", "lajoina01", "lajoina01", "lajoina01", "lajoina01", "lajoina01", "lajoina01", "lajoina01",
+#> "lajoina01", "lajoina01", "lajoina01", "lajoina01", "lajoina01", "lajoina01", "wadderu01", "wadderu01", "wadderu01", "wadderu01", "wadderu01", "wadderu01", "wadderu01", "wadderu01", "wadderu01", "wadderu01", "wadderu01", "wadderu01", "wadderu01", "wadderu01", "mathech01", "mathech01", "mathech01", "mathech01", "mathech01", "mathech01", "mathech01", "mathech01", "mathech01", "mathech01", "mathech01", "mathech01", "mathech01", "mathech01", "mathech01", "mathech01", "mathech01", "mathech01", "chaseha01",
+#> "chaseha01", "chaseha01", "chaseha01", "chaseha01", "chaseha01", "chaseha01", "chaseha01", "chaseha01", "chaseha01", "chaseha01", "chaseha01", "chaseha01", "chaseha01", "chaseha01", "chaseha01", "chaseha01", "lordha01", "lordha01", "lordha01", "lordha01", "lordha01", "lordha01", "lordha01", "lordha01", "lordha01", "lordha01", "crigelo01", "crigelo01", "crigelo01", "crigelo01", "crigelo01", "crigelo01", "crigelo01", "crigelo01", "crigelo01", "crigelo01", "crigelo01", "crigelo01", "crigelo01", "crigelo01",
+#> "crigelo01", "crigelo01", "sullibi03", "sullibi03", "sullibi03", "sullibi03", "sullibi03", "sullibi03", "sullibi03", "sullibi03", "sullibi03", "sullibi03", "sullibi03", "sullibi03", "sullibi03", "sullibi03", "sullibi03", "sullibi03", "crawfsa01", "crawfsa01", "crawfsa01", "crawfsa01", "crawfsa01", "crawfsa01", "crawfsa01", "crawfsa01", "crawfsa01", "crawfsa01", "crawfsa01", "crawfsa01", "crawfsa01", "crawfsa01", "crawfsa01", "crawfsa01", "crawfsa01", "crawfsa01", "crawfsa01", "stonege01", "stonege01",
+#> "stonege01", "stonege01", "stonege01", "stonege01", "stonege01", "walshed01", "walshed01", "walshed01", "walshed01", "walshed01", "walshed01", "walshed01", "walshed01", "walshed01", "walshed01", "walshed01", "walshed01", "walshed01", "walshed01", "jossad01", "jossad01", "jossad01", "jossad01", "jossad01", "jossad01", "jossad01", "jossad01", "jossad01", "donovbi01", "donovbi01", "donovbi01", "donovbi01", "donovbi01", "donovbi01", "donovbi01", "donovbi01", "donovbi01", "donovbi01", "donovbi01", "donovbi01",
+#> "donovbi01", "donovbi01", "donovbi01", "donovbi01", "donovbi01", "donovbi01", "cobbty01", "cobbty01", "cobbty01", "cobbty01", "cobbty01", "cobbty01", "cobbty01", "cobbty01", "cobbty01", "cobbty01", "cobbty01", "cobbty01", "cobbty01", "cobbty01", "cobbty01", "cobbty01", "cobbty01", "cobbty01", "cobbty01", "cobbty01", "cobbty01", "cobbty01", "cobbty01", "cobbty01", "wallabo01", "wallabo01", "wallabo01", "wallabo01", "wallabo01", "wallabo01", "wallabo01", "wallabo01", "wallabo01", "wallabo01", "wallabo01",
+#> "wallabo01", "wallabo01", "wallabo01", "wallabo01", "wallabo01", "wallabo01", "wallabo01", "wallabo01", "wallabo01", "wallabo01", "wallabo01", "wallabo01", "wallabo01", "wallabo01", "devliar01", "devliar01", "devliar01", "devliar01", "devliar01", "devliar01", "devliar01", "devliar01", "devliar01", "devliar01", "bresnro01", "bresnro01", "bresnro01", "bresnro01", "bresnro01", "bresnro01", "bresnro01", "bresnro01", "bresnro01", "bresnro01", "bresnro01", "bresnro01", "bresnro01", "bresnro01", "bresnro01",
+#> "bresnro01", "bresnro01", "bresnro01", "klingjo01", "klingjo01", "klingjo01", "klingjo01", "klingjo01", "klingjo01", "klingjo01", "klingjo01", "klingjo01", "klingjo01", "klingjo01", "klingjo01", "klingjo01", "klingjo01", "donlimi01", "donlimi01", "donlimi01", "donlimi01", "donlimi01", "donlimi01", "donlimi01", "donlimi01", "donlimi01", "donlimi01", "donlimi01", "donlimi01", "donlimi01", "donlimi01", "clarkfr01", "clarkfr01", "clarkfr01", "clarkfr01", "clarkfr01", "clarkfr01", "clarkfr01", "clarkfr01",
+#> "clarkfr01", "clarkfr01", "clarkfr01", "clarkfr01", "clarkfr01", "clarkfr01", "clarkfr01", "clarkfr01", "clarkfr01", "clarkfr01", "clarkfr01", "clarkfr01", "clarkfr01", "brownmo01", "brownmo01", "brownmo01", "brownmo01", "brownmo01", "brownmo01", "brownmo01", "brownmo01", "brownmo01", "brownmo01", "brownmo01", "brownmo01", "brownmo01", "brownmo01", "brownmo01", "ruckena01", "ruckena01", "ruckena01", "ruckena01", "ruckena01", "ruckena01", "ruckena01", "ruckena01", "ruckena01", "ruckena01", "wagneho01",
+#> "wagneho01", "wagneho01", "wagneho01", "wagneho01", "wagneho01", "wagneho01", "wagneho01", "wagneho01", "wagneho01", "wagneho01", "wagneho01", "wagneho01", "wagneho01", "wagneho01", "wagneho01", "wagneho01", "wagneho01", "wagneho01", "wagneho01", "wagneho01", "tennefr02", "tennefr02", "tennefr02", "tennefr02", "tennefr02", "tennefr02", "tennefr02", "tennefr02", "tennefr02", "tennefr02", "tennefr02", "tennefr02", "tennefr02", "tennefr02", "tennefr02", "tennefr02", "tennefr02", "eversjo01", "eversjo01",
+#> "eversjo01", "eversjo01", "eversjo01", "eversjo01", "eversjo01", "eversjo01", "eversjo01", "eversjo01", "eversjo01", "eversjo01", "eversjo01", "eversjo01", "eversjo01", "eversjo01", "eversjo01", "eversjo01", "eversjo01", "willivi01", "willivi01", "willivi01", "willivi01", "willivi01", "willivi01", "willivi01", "willivi01", "willivi01", "willivi01", "willivi01", "willivi01", "willivi01", "reulbed01", "reulbed01", "reulbed01", "reulbed01", "reulbed01", "reulbed01", "reulbed01", "reulbed01", "reulbed01",
+#> "reulbed01", "reulbed01", "reulbed01", "reulbed01", "reulbed01", "schulfr01", "schulfr01", "schulfr01", "schulfr01", "schulfr01", "schulfr01", "schulfr01", "schulfr01", "schulfr01", "schulfr01", "schulfr01", "schulfr01", "schulfr01", "schulfr01", "schulfr01", "schulfr01", "schulfr01", "collied01", "collied01", "collied01", "collied01", "collied01", "collied01", "collied01", "collied01", "collied01", "collied01", "collied01", "collied01", "collied01", "collied01", "collied01", "collied01", "collied01",
+#> "collied01", "collied01", "collied01", "collied01", "collied01", "collied01", "collied01", "collied01", "carribi02", "carribi02", "carribi02", "carribi02", "carribi02", "carribi02", "carribi02", "carribi02", "carribi02", "carribi02", "streega01", "streega01", "streega01", "streega01", "streega01", "streega01", "streega01", "streega01", "streega01", "streega01", "speaktr01", "speaktr01", "speaktr01", "speaktr01", "speaktr01", "speaktr01", "speaktr01", "speaktr01", "speaktr01", "speaktr01", "speaktr01",
+#> "speaktr01", "speaktr01", "speaktr01", "speaktr01", "speaktr01", "speaktr01", "speaktr01", "speaktr01", "speaktr01", "speaktr01", "speaktr01", "planked01", "planked01", "planked01", "planked01", "planked01", "planked01", "planked01", "planked01", "planked01", "planked01", "planked01", "planked01", "planked01", "planked01", "planked01", "planked01", "planked01", "johnswa01", "johnswa01", "johnswa01", "johnswa01", "johnswa01", "johnswa01", "johnswa01", "johnswa01", "johnswa01", "johnswa01", "johnswa01",
+#> "johnswa01", "johnswa01", "johnswa01", "johnswa01", "johnswa01", "johnswa01", "johnswa01", "johnswa01", "johnswa01", "johnswa01", "mullige01", "mullige01", "mullige01", "mullige01", "mullige01", "mullige01", "mullige01", "mullige01", "mullige01", "mullige01", "mullige01", "mullige01", "mullige01", "mullige01", "mullige01", "woodjo02", "woodjo02", "woodjo02", "woodjo02", "woodjo02", "woodjo02", "woodjo02", "woodjo02", "woodjo02", "woodjo02", "woodjo02", "woodjo02", "woodjo02", "woodjo02", "bushdo01",
+#> "bushdo01", "bushdo01", "bushdo01", "bushdo01", "bushdo01", "bushdo01", "bushdo01", "bushdo01", "bushdo01", "bushdo01", "bushdo01", "bushdo01", "bushdo01", "bushdo01", "bushdo01", "bushdo01", "gibsoge01", "gibsoge01", "gibsoge01", "gibsoge01", "gibsoge01", "gibsoge01", "gibsoge01", "gibsoge01", "gibsoge01", "gibsoge01", "gibsoge01", "gibsoge01", "gibsoge01", "gibsoge01", "adamsba01", "adamsba01", "adamsba01", "adamsba01", "adamsba01", "adamsba01", "adamsba01", "adamsba01", "adamsba01", "adamsba01",
+#> "adamsba01", "adamsba01", "adamsba01", "adamsba01", "adamsba01", "adamsba01", "adamsba01", "adamsba01", "adamsba01", "chancfr01", "chancfr01", "chancfr01", "chancfr01", "chancfr01", "chancfr01", "chancfr01", "chancfr01", "chancfr01", "chancfr01", "chancfr01", "chancfr01", "chancfr01", "chancfr01", "chancfr01", "chancfr01", "chancfr01", "leachto01", "leachto01", "leachto01", "leachto01", "leachto01", "leachto01", "leachto01", "leachto01", "leachto01", "leachto01", "leachto01", "leachto01", "leachto01",
+#> "leachto01", "leachto01", "leachto01", "leachto01", "leachto01", "leachto01", "leachto01", "camniho01", "camniho01", "camniho01", "camniho01", "camniho01", "camniho01", "camniho01", "camniho01", "camniho01", "camniho01", "camniho01", "camniho01", "hofmaso01", "hofmaso01", "hofmaso01", "hofmaso01", "hofmaso01", "hofmaso01", "hofmaso01", "hofmaso01", "hofmaso01", "hofmaso01", "hofmaso01", "hofmaso01", "hofmaso01", "hofmaso01", "hofmaso01", "hofmaso01", "thomair01", "thomair01", "thomair01", "thomair01",
+#> "thomair01", "thomair01", "thomair01", "thomair01", "thomair01", "thomair01", "sweened01", "sweened01", "sweened01", "sweened01", "sweened01", "sweened01", "sweened01", "sweened01", "sweened01", "coombja01", "coombja01", "coombja01", "coombja01", "coombja01", "coombja01", "coombja01", "coombja01", "coombja01", "coombja01", "coombja01", "coombja01", "coombja01", "coombja01", "bendech01", "bendech01", "bendech01", "bendech01", "bendech01", "bendech01", "bendech01", "bendech01", "bendech01", "bendech01",
+#> "bendech01", "bendech01", "bendech01", "bendech01", "bendech01", "bendech01", "archeji01", "archeji01", "archeji01", "archeji01", "archeji01", "archeji01", "archeji01", "archeji01", "archeji01", "archeji01", "archeji01", "archeji01", "archeji01", "archeji01", "mageesh01", "mageesh01", "mageesh01", "mageesh01", "mageesh01", "mageesh01", "mageesh01", "mageesh01", "mageesh01", "mageesh01", "mageesh01", "mageesh01", "mageesh01", "mageesh01", "mageesh01", "mageesh01", "mageesh01", "coleki01", "coleki01",
+#> "coleki01", "coleki01", "coleki01", "coleki01", "coleki01", "bakerfr01", "bakerfr01", "bakerfr01", "bakerfr01", "bakerfr01", "bakerfr01", "bakerfr01", "bakerfr01", "bakerfr01", "bakerfr01", "bakerfr01", "bakerfr01", "bakerfr01", "stanaos01", "stanaos01", "stanaos01", "stanaos01", "stanaos01", "stanaos01", "stanaos01", "stanaos01", "stanaos01", "stanaos01", "stanaos01", "stanaos01", "stanaos01", "stanaos01", "greggve01", "greggve01", "greggve01", "greggve01", "greggve01", "greggve01", "greggve01",
+#> "greggve01", "greggve01", "jacksjo01", "jacksjo01", "jacksjo01", "jacksjo01", "jacksjo01", "jacksjo01", "jacksjo01", "jacksjo01", "jacksjo01", "jacksjo01", "jacksjo01", "jacksjo01", "jacksjo01", "jacksjo01", "dooinre01", "dooinre01", "dooinre01", "dooinre01", "dooinre01", "dooinre01", "dooinre01", "dooinre01", "dooinre01", "dooinre01", "dooinre01", "dooinre01", "dooinre01", "dooinre01", "dooinre01", "dooinre01", "meyerch01", "meyerch01", "meyerch01", "meyerch01", "meyerch01", "meyerch01", "meyerch01",
+#> "meyerch01", "meyerch01", "meyerch01", "alexape01", "alexape01", "alexape01", "alexape01", "alexape01", "alexape01", "alexape01", "alexape01", "alexape01", "alexape01", "alexape01", "alexape01", "alexape01", "alexape01", "alexape01", "alexape01", "alexape01", "alexape01", "alexape01", "alexape01", "alexape01", "daubeja01", "daubeja01", "daubeja01", "daubeja01", "daubeja01", "daubeja01", "daubeja01", "daubeja01", "daubeja01", "daubeja01", "daubeja01", "daubeja01", "daubeja01", "daubeja01", "daubeja01",
+#> "doylela01", "doylela01", "doylela01", "doylela01", "doylela01", "doylela01", "doylela01", "doylela01", "doylela01", "doylela01", "doylela01", "doylela01", "doylela01", "doylela01", "doylela01", "loberha01", "loberha01", "loberha01", "loberha01", "loberha01", "loberha01", "loberha01", "loberha01", "loberha01", "loberha01", "loberha01", "loberha01", "loberha01", "loberha01", "marquru01", "marquru01", "marquru01", "marquru01", "marquru01", "marquru01", "marquru01", "marquru01", "marquru01", "marquru01",
+#> "marquru01", "marquru01", "marquru01", "marquru01", "marquru01", "marquru01", "marquru01", "marquru01", "marquru01", "mcinnst01", "mcinnst01", "mcinnst01", "mcinnst01", "mcinnst01", "mcinnst01", "mcinnst01", "mcinnst01", "mcinnst01", "mcinnst01", "mcinnst01", "mcinnst01", "mcinnst01", "mcinnst01", "mcinnst01", "mcinnst01", "mcinnst01", "mcinnst01", "mcinnst01", "gardnla01", "gardnla01", "gardnla01", "gardnla01", "gardnla01", "gardnla01", "gardnla01", "gardnla01", "gardnla01", "gardnla01", "gardnla01",
+#> "gardnla01", "gardnla01", "gardnla01", "gardnla01", "gardnla01", "gardnla01", "ainsmed01", "ainsmed01", "ainsmed01", "ainsmed01", "ainsmed01", "ainsmed01", "ainsmed01", "ainsmed01", "ainsmed01", "ainsmed01", "ainsmed01", "ainsmed01", "ainsmed01", "ainsmed01", "ainsmed01", "ainsmed01", "ainsmed01", "wagnehe01", "wagnehe01", "wagnehe01", "wagnehe01", "wagnehe01", "wagnehe01", "wagnehe01", "wagnehe01", "wagnehe01", "wagnehe01", "wagnehe01", "wagnehe01", "zimmehe01", "zimmehe01", "zimmehe01", "zimmehe01",
+#> "zimmehe01", "zimmehe01", "zimmehe01", "zimmehe01", "zimmehe01", "zimmehe01", "zimmehe01", "zimmehe01", "zimmehe01", "zimmehe01", "paskedo01", "paskedo01", "paskedo01", "paskedo01", "paskedo01", "paskedo01", "paskedo01", "paskedo01", "paskedo01", "paskedo01", "paskedo01", "paskedo01", "paskedo01", "paskedo01", "paskedo01", "wilsoch01", "wilsoch01", "wilsoch01", "wilsoch01", "wilsoch01", "wilsoch01", "wilsoch01", "wilsoch01", "wilsoch01", "tesreje01", "tesreje01", "tesreje01", "tesreje01", "tesreje01",
+#> "tesreje01", "tesreje01", "schanwa01", "schanwa01", "schanwa01", "schanwa01", "schanwa01", "schanwa01", "schanwa01", "schanwa01", "schanwa01", "schanwa01", "schanwa01", "schanwa01", "schanwa01", "schanwa01", "schanwa01", "schanwa01", "schanwa01", "schanwa01", "schanwa01", "falkecy01", "falkecy01", "falkecy01", "falkecy01", "falkecy01", "falkecy01", "falkecy01", "falkecy01", "falkecy01", "falkecy01", "falkecy01", "falkecy01", "falkecy01", "falkecy01", "barryja01", "barryja01", "barryja01", "barryja01",
+#> "barryja01", "barryja01", "barryja01", "barryja01", "barryja01", "barryja01", "barryja01", "barryja01", "vioxji01", "vioxji01", "vioxji01", "vioxji01", "vioxji01", "cravaga01", "cravaga01", "cravaga01", "cravaga01", "cravaga01", "cravaga01", "cravaga01", "cravaga01", "cravaga01", "cravaga01", "cravaga01", "cravaga01", "wheatza01", "wheatza01", "wheatza01", "wheatza01", "wheatza01", "wheatza01", "wheatza01", "wheatza01", "wheatza01", "wheatza01", "wheatza01", "wheatza01", "wheatza01", "wheatza01",
+#> "wheatza01", "wheatza01", "wheatza01", "wheatza01", "wheatza01", "schalra01", "schalra01", "schalra01", "schalra01", "schalra01", "schalra01", "schalra01", "schalra01", "schalra01", "schalra01", "schalra01", "schalra01", "schalra01", "schalra01", "schalra01", "schalra01", "schalra01", "schalra01", "leonadu01", "leonadu01", "leonadu01", "leonadu01", "leonadu01", "leonadu01", "leonadu01", "leonadu01", "leonadu01", "leonadu01", "leonadu01", "maranra01", "maranra01", "maranra01", "maranra01", "maranra01",
+#> "maranra01", "maranra01", "maranra01", "maranra01", "maranra01", "maranra01", "maranra01", "maranra01", "maranra01", "maranra01", "maranra01", "maranra01", "maranra01", "maranra01", "maranra01", "maranra01", "maranra01", "maranra01", "wingoiv01", "wingoiv01", "wingoiv01", "wingoiv01", "wingoiv01", "wingoiv01", "wingoiv01", "wingoiv01", "wingoiv01", "wingoiv01", "wingoiv01", "wingoiv01", "wingoiv01", "wingoiv01", "wingoiv01", "wingoiv01", "wingoiv01", "burnsge01", "burnsge01", "burnsge01", "burnsge01",
+#> "burnsge01", "burnsge01", "burnsge01", "burnsge01", "burnsge01", "burnsge01", "burnsge01", "burnsge01", "burnsge01", "burnsge01", "burnsge01", "jamesbi02", "jamesbi02", "jamesbi02", "jamesbi02", "maisefr01", "maisefr01", "maisefr01", "maisefr01", "maisefr01", "maisefr01", "scottji01", "scottji01", "scottji01", "scottji01", "scottji01", "scottji01", "scottji01", "scottji01", "scottji01", "grohhe01", "grohhe01", "grohhe01", "grohhe01", "grohhe01", "grohhe01", "grohhe01", "grohhe01", "grohhe01", "grohhe01",
+#> "grohhe01", "grohhe01", "grohhe01", "grohhe01", "grohhe01", "grohhe01", "grohhe01", "snydefr01", "snydefr01", "snydefr01", "snydefr01", "snydefr01", "snydefr01", "snydefr01", "snydefr01", "snydefr01", "snydefr01", "snydefr01", "snydefr01", "snydefr01", "snydefr01", "snydefr01", "snydefr01", "snydefr01", "bancrda01", "bancrda01", "bancrda01", "bancrda01", "bancrda01", "bancrda01", "bancrda01", "bancrda01", "bancrda01", "bancrda01", "bancrda01", "bancrda01", "bancrda01", "bancrda01", "bancrda01", "bancrda01",
+#> "bancrda01", "saiervi01", "saiervi01", "saiervi01", "saiervi01", "saiervi01", "saiervi01", "saiervi01", "saiervi01", "willicy01", "willicy01", "willicy01", "willicy01", "willicy01", "willicy01", "willicy01", "willicy01", "willicy01", "willicy01", "willicy01", "willicy01", "willicy01", "willicy01", "willicy01", "willicy01", "willicy01", "willicy01", "willicy01", "mamaual01", "mamaual01", "mamaual01", "mamaual01", "mamaual01", "mamaual01", "mamaual01", "mamaual01", "mamaual01", "mamaual01", "mamaual01",
+#> "mamaual01", "sislege01", "sislege01", "sislege01", "sislege01", "sislege01", "sislege01", "sislege01", "sislege01", "sislege01", "sislege01", "sislege01", "sislege01", "sislege01", "sislege01", "sislege01", "sislege01", "ruthba01", "ruthba01", "ruthba01", "ruthba01", "ruthba01", "ruthba01", "ruthba01", "ruthba01", "ruthba01", "ruthba01", "ruthba01", "ruthba01", "ruthba01", "ruthba01", "ruthba01", "ruthba01", "ruthba01", "ruthba01", "ruthba01", "ruthba01", "ruthba01", "ruthba01", "herzobu01", "herzobu01",
+#> "herzobu01", "herzobu01", "herzobu01", "herzobu01", "herzobu01", "herzobu01", "herzobu01", "herzobu01", "herzobu01", "herzobu01", "herzobu01", "herzobu01", "herzobu01", "herzobu01", "hornsro01", "hornsro01", "hornsro01", "hornsro01", "hornsro01", "hornsro01", "hornsro01", "hornsro01", "hornsro01", "hornsro01", "hornsro01", "hornsro01", "hornsro01", "hornsro01", "hornsro01", "hornsro01", "hornsro01", "hornsro01", "hornsro01", "hornsro01", "hornsro01", "hornsro01", "hornsro01", "hornsro01", "gowdyha01",
+#> "gowdyha01", "gowdyha01", "gowdyha01", "gowdyha01", "gowdyha01", "gowdyha01", "gowdyha01", "gowdyha01", "gowdyha01", "gowdyha01", "gowdyha01", "gowdyha01", "gowdyha01", "gowdyha01", "gowdyha01", "gowdyha01", "gowdyha01", "gowdyha01", "roberda01", "roberda01", "roberda01", "roberda01", "roberda01", "roberda01", "roberda01", "roberda01", "roberda01", "roberda01", "roberda01", "weavebu01", "weavebu01", "weavebu01", "weavebu01", "weavebu01", "weavebu01", "weavebu01", "weavebu01", "weavebu01", "felscha01",
+#> "felscha01", "felscha01", "felscha01", "felscha01", "felscha01", "cicoted01", "cicoted01", "cicoted01", "cicoted01", "cicoted01", "cicoted01", "cicoted01", "cicoted01", "cicoted01", "cicoted01", "cicoted01", "cicoted01", "cicoted01", "cicoted01", "cicoted01", "chapmra01", "chapmra01", "chapmra01", "chapmra01", "chapmra01", "chapmra01", "chapmra01", "chapmra01", "chapmra01", "killebi01", "killebi01", "killebi01", "killebi01", "killebi01", "killebi01", "killebi01", "killebi01", "killebi01", "killebi01",
+#> "killebi01", "killebi01", "killebi01", "roushed01", "roushed01", "roushed01", "roushed01", "roushed01", "roushed01", "roushed01", "roushed01", "roushed01", "roushed01", "roushed01", "roushed01", "roushed01", "roushed01", "roushed01", "roushed01", "roushed01", "roushed01", "roushed01", "careyma01", "careyma01", "careyma01", "careyma01", "careyma01", "careyma01", "careyma01", "careyma01", "careyma01", "careyma01", "careyma01", "careyma01", "careyma01", "careyma01", "careyma01", "careyma01", "careyma01",
+#> "careyma01", "careyma01", "careyma01", "careyma01", "coopewi01", "coopewi01", "coopewi01", "coopewi01", "coopewi01", "coopewi01", "coopewi01", "coopewi01", "coopewi01", "coopewi01", "coopewi01", "coopewi01", "coopewi01", "coopewi01", "coopewi01", "coopewi01", "oneilst01", "oneilst01", "oneilst01", "oneilst01", "oneilst01", "oneilst01", "oneilst01", "oneilst01", "oneilst01", "oneilst01", "oneilst01", "oneilst01", "oneilst01", "oneilst01", "oneilst01", "oneilst01", "oneilst01", "hoopeha01", "hoopeha01",
+#> "hoopeha01", "hoopeha01", "hoopeha01", "hoopeha01", "hoopeha01", "hoopeha01", "hoopeha01", "hoopeha01", "hoopeha01", "hoopeha01", "hoopeha01", "hoopeha01", "hoopeha01", "hoopeha01", "hoopeha01", "vaughhi01", "vaughhi01", "vaughhi01", "vaughhi01", "vaughhi01", "vaughhi01", "vaughhi01", "vaughhi01", "vaughhi01", "vaughhi01", "vaughhi01", "vaughhi01", "vaughhi01", "vaughhi01", "holloch01", "holloch01", "holloch01", "holloch01", "holloch01", "holloch01", "holloch01", "cutshge01", "cutshge01", "cutshge01",
+#> "cutshge01", "cutshge01", "cutshge01", "cutshge01", "cutshge01", "cutshge01", "cutshge01", "cutshge01", "cutshge01", "grimebu01", "grimebu01", "grimebu01", "grimebu01", "grimebu01", "grimebu01", "grimebu01", "grimebu01", "grimebu01", "grimebu01", "grimebu01", "grimebu01", "grimebu01", "grimebu01", "grimebu01", "grimebu01", "grimebu01", "grimebu01", "grimebu01", "grimebu01", "grimebu01", "grimebu01", "grimebu01", "peckiro01", "peckiro01", "peckiro01", "peckiro01", "peckiro01", "peckiro01", "peckiro01",
+#> "peckiro01", "peckiro01", "peckiro01", "peckiro01", "peckiro01", "peckiro01", "peckiro01", "peckiro01", "peckiro01", "peckiro01", "peckiro01", "stockmi01", "stockmi01", "stockmi01", "stockmi01", "stockmi01", "stockmi01", "stockmi01", "stockmi01", "stockmi01", "stockmi01", "stockmi01", "stockmi01", "stockmi01", "stockmi01", "myershy01", "myershy01", "myershy01", "myershy01", "myershy01", "myershy01", "myershy01", "myershy01", "myershy01", "myershy01", "myershy01", "myershy01", "myershy01", "myershy01",
+#> "myershy01", "myershy01", "barneje01", "barneje01", "barneje01", "barneje01", "barneje01", "barneje01", "barneje01", "barneje01", "barneje01", "barneje01", "barneje01", "barneje01", "barneje01", "barneje01", "ricesa01", "ricesa01", "ricesa01", "ricesa01", "ricesa01", "ricesa01", "ricesa01", "ricesa01", "ricesa01", "ricesa01", "ricesa01", "ricesa01", "ricesa01", "ricesa01", "ricesa01", "ricesa01", "ricesa01", "ricesa01", "ricesa01", "ricesa01", "bagbyji01", "bagbyji01", "bagbyji01", "bagbyji01", "bagbyji01",
+#> "bagbyji01", "bagbyji01", "bagbyji01", "bagbyji01", "covelst01", "covelst01", "covelst01", "covelst01", "covelst01", "covelst01", "covelst01", "covelst01", "covelst01", "covelst01", "covelst01", "covelst01", "covelst01", "covelst01", "shockur01", "shockur01", "shockur01", "shockur01", "shockur01", "shockur01", "shockur01", "shockur01", "shockur01", "shockur01", "shockur01", "shockur01", "shockur01", "scottev01", "scottev01", "scottev01", "scottev01", "scottev01", "scottev01", "scottev01", "scottev01",
+#> "scottev01", "scottev01", "scottev01", "scottev01", "scottev01", "scottev01", "scottev01", "schmiwa01", "schmiwa01", "schmiwa01", "schmiwa01", "schmiwa01", "schmiwa01", "schmiwa01", "schmiwa01", "schmiwa01", "schmiwa01", "youngro01", "youngro01", "youngro01", "youngro01", "youngro01", "youngro01", "youngro01", "youngro01", "youngro01", "youngro01", "faberre01", "faberre01", "faberre01", "faberre01", "faberre01", "faberre01", "faberre01", "faberre01", "faberre01", "faberre01", "faberre01", "faberre01",
+#> "faberre01", "faberre01", "faberre01", "faberre01", "faberre01", "faberre01", "faberre01", "faberre01", "maysca01", "maysca01", "maysca01", "maysca01", "maysca01", "maysca01", "maysca01", "maysca01", "maysca01", "maysca01", "maysca01", "maysca01", "maysca01", "maysca01", "maysca01", "maysca01", "friscfr01", "friscfr01", "friscfr01", "friscfr01", "friscfr01", "friscfr01", "friscfr01", "friscfr01", "friscfr01", "friscfr01", "friscfr01", "friscfr01", "friscfr01", "friscfr01", "friscfr01", "friscfr01",
+#> "friscfr01", "friscfr01", "friscfr01", "kellyge01", "kellyge01", "kellyge01", "kellyge01", "kellyge01", "kellyge01", "kellyge01", "kellyge01", "kellyge01", "kellyge01", "kellyge01", "kellyge01", "kellyge01", "kellyge01", "kellyge01", "kellyge01", "kellyge01", "kellyge01", "bigbeca01", "bigbeca01", "bigbeca01", "bigbeca01", "bigbeca01", "bigbeca01", "bigbeca01", "bigbeca01", "bigbeca01", "bigbeca01", "bigbeca01", "nehfar01", "nehfar01", "nehfar01", "nehfar01", "nehfar01", "nehfar01", "nehfar01", "nehfar01",
+#> "nehfar01", "nehfar01", "nehfar01", "nehfar01", "nehfar01", "nehfar01", "nehfar01", "nehfar01", "nehfar01", "nehfar01", "duganjo01", "duganjo01", "duganjo01", "duganjo01", "duganjo01", "duganjo01", "duganjo01", "duganjo01", "duganjo01", "duganjo01", "duganjo01", "duganjo01", "duganjo01", "duganjo01", "duganjo01", "bushjo01", "bushjo01", "bushjo01", "bushjo01", "bushjo01", "bushjo01", "bushjo01", "bushjo01", "bushjo01", "bushjo01", "bushjo01", "bushjo01", "bushjo01", "bushjo01", "bushjo01", "bushjo01",
+#> "bushjo01", "bushjo01", "bushjo01", "rommeed01", "rommeed01", "rommeed01", "rommeed01", "rommeed01", "rommeed01", "rommeed01", "rommeed01", "rommeed01", "rommeed01", "rommeed01", "rommeed01", "rommeed01", "rixeyep01", "rixeyep01", "rixeyep01", "rixeyep01", "rixeyep01", "rixeyep01", "rixeyep01", "rixeyep01", "rixeyep01", "rixeyep01", "rixeyep01", "rixeyep01", "rixeyep01", "rixeyep01", "rixeyep01", "rixeyep01", "rixeyep01", "rixeyep01", "rixeyep01", "rixeyep01", "rixeyep01", "ruethdu01", "ruethdu01",
+#> "ruethdu01", "ruethdu01", "ruethdu01", "ruethdu01", "ruethdu01", "ruethdu01", "ruethdu01", "ruethdu01", "ruethdu01", "ruethdu01", "ruethdu01", "pippwa01", "pippwa01", "pippwa01", "pippwa01", "pippwa01", "pippwa01", "pippwa01", "pippwa01", "pippwa01", "pippwa01", "pippwa01", "pippwa01", "pippwa01", "pippwa01", "pippwa01", "perkicy01", "perkicy01", "perkicy01", "perkicy01", "perkicy01", "perkicy01", "perkicy01", "perkicy01", "perkicy01", "perkicy01", "perkicy01", "perkicy01", "perkicy01", "perkicy01",
+#> "perkicy01", "perkicy01", "perkicy01", "heilmha01", "heilmha01", "heilmha01", "heilmha01", "heilmha01", "heilmha01", "heilmha01", "heilmha01", "heilmha01", "heilmha01", "heilmha01", "heilmha01", "heilmha01", "heilmha01", "heilmha01", "heilmha01", "heilmha01", "uhlege01", "uhlege01", "uhlege01", "uhlege01", "uhlege01", "uhlege01", "uhlege01", "uhlege01", "uhlege01", "uhlege01", "uhlege01", "uhlege01", "uhlege01", "uhlege01", "uhlege01", "uhlege01", "uhlege01", "uhlege01", "uhlege01", "ehmkeho01",
+#> "ehmkeho01", "ehmkeho01", "ehmkeho01", "ehmkeho01", "ehmkeho01", "ehmkeho01", "ehmkeho01", "ehmkeho01", "ehmkeho01", "ehmkeho01", "ehmkeho01", "ehmkeho01", "ehmkeho01", "ehmkeho01", "ehmkeho01", "seweljo01", "seweljo01", "seweljo01", "seweljo01", "seweljo01", "seweljo01", "seweljo01", "seweljo01", "seweljo01", "seweljo01", "seweljo01", "seweljo01", "seweljo01", "seweljo01", "grimmch01", "grimmch01", "grimmch01", "grimmch01", "grimmch01", "grimmch01", "grimmch01", "grimmch01", "grimmch01", "grimmch01",
+#> "grimmch01", "grimmch01", "grimmch01", "grimmch01", "grimmch01", "grimmch01", "grimmch01", "grimmch01", "grimmch01", "grimmch01", "ofarrbo01", "ofarrbo01", "ofarrbo01", "ofarrbo01", "ofarrbo01", "ofarrbo01", "ofarrbo01", "ofarrbo01", "ofarrbo01", "ofarrbo01", "ofarrbo01", "ofarrbo01", "ofarrbo01", "ofarrbo01", "ofarrbo01", "ofarrbo01", "ofarrbo01", "ofarrbo01", "ofarrbo01", "ofarrbo01", "ofarrbo01", "ofarrbo01", "ofarrbo01", "ofarrbo01", "luquedo01", "luquedo01", "luquedo01", "luquedo01", "luquedo01",
+#> "luquedo01", "luquedo01", "luquedo01", "luquedo01", "luquedo01", "luquedo01", "luquedo01", "luquedo01", "luquedo01", "luquedo01", "luquedo01", "luquedo01", "luquedo01", "luquedo01", "luquedo01", "morrijo04", "morrijo04", "morrijo04", "morrijo04", "morrijo04", "morrijo04", "morrijo04", "morrijo04", "morrijo04", "morrijo04", "vanceda01", "vanceda01", "vanceda01", "vanceda01", "vanceda01", "vanceda01", "vanceda01", "vanceda01", "vanceda01", "vanceda01", "vanceda01", "vanceda01", "vanceda01", "vanceda01",
+#> "vanceda01", "vanceda01", "vanceda01", "vanceda01", "judgejo01", "judgejo01", "judgejo01", "judgejo01", "judgejo01", "judgejo01", "judgejo01", "judgejo01", "judgejo01", "judgejo01", "judgejo01", "judgejo01", "judgejo01", "judgejo01", "judgejo01", "judgejo01", "judgejo01", "judgejo01", "judgejo01", "judgejo01", "judgejo01", "bassljo01", "bassljo01", "bassljo01", "bassljo01", "bassljo01", "bassljo01", "bassljo01", "bassljo01", "bassljo01", "jamiech01", "jamiech01", "jamiech01", "jamiech01", "jamiech01",
+#> "jamiech01", "jamiech01", "jamiech01", "jamiech01", "jamiech01", "jamiech01", "jamiech01", "jamiech01", "jamiech01", "jamiech01", "jamiech01", "jamiech01", "jamiech01", "jamiech01", "thurssl01", "thurssl01", "thurssl01", "thurssl01", "thurssl01", "thurssl01", "thurssl01", "thurssl01", "thurssl01", "thurssl01", "pennohe01", "pennohe01", "pennohe01", "pennohe01", "pennohe01", "pennohe01", "pennohe01", "pennohe01", "pennohe01", "pennohe01", "pennohe01", "pennohe01", "pennohe01", "pennohe01", "pennohe01",
+#> "pennohe01", "pennohe01", "pennohe01", "pennohe01", "pennohe01", "pennohe01", "pennohe01", "pennohe01", "jackstr01", "jackstr01", "jackstr01", "jackstr01", "jackstr01", "jackstr01", "jackstr01", "jackstr01", "jackstr01", "jackstr01", "jackstr01", "jackstr01", "jackstr01", "jackstr01", "jackstr01", "traynpi01", "traynpi01", "traynpi01", "traynpi01", "traynpi01", "traynpi01", "traynpi01", "traynpi01", "traynpi01", "traynpi01", "traynpi01", "traynpi01", "traynpi01", "traynpi01", "traynpi01", "traynpi01",
+#> "traynpi01", "hartnga01", "hartnga01", "hartnga01", "hartnga01", "hartnga01", "hartnga01", "hartnga01", "hartnga01", "hartnga01", "hartnga01", "hartnga01", "hartnga01", "hartnga01", "hartnga01", "hartnga01", "hartnga01", "hartnga01", "hartnga01", "hartnga01", "hartnga01", "bluegos01", "bluegos01", "bluegos01", "bluegos01", "bluegos01", "bluegos01", "bluegos01", "bluegos01", "bluegos01", "bluegos01", "bluegos01", "bluegos01", "bluegos01", "bluegos01", "bluegos01", "bluegos01", "bluegos01", "bluegos01",
+#> "ruelmu01", "ruelmu01", "ruelmu01", "ruelmu01", "ruelmu01", "ruelmu01", "ruelmu01", "ruelmu01", "ruelmu01", "ruelmu01", "ruelmu01", "ruelmu01", "ruelmu01", "ruelmu01", "ruelmu01", "ruelmu01", "ruelmu01", "ruelmu01", "ruelmu01", "ruelmu01", "cochrmi01", "cochrmi01", "cochrmi01", "cochrmi01", "cochrmi01", "cochrmi01", "cochrmi01", "cochrmi01", "cochrmi01", "cochrmi01", "cochrmi01", "cochrmi01", "cochrmi01", "simmoal01", "simmoal01", "simmoal01", "simmoal01", "simmoal01", "simmoal01", "simmoal01", "simmoal01",
+#> "simmoal01", "simmoal01", "simmoal01", "simmoal01", "simmoal01", "simmoal01", "simmoal01", "simmoal01", "simmoal01", "simmoal01", "simmoal01", "simmoal01", "simmoal01", "gosligo01", "gosligo01", "gosligo01", "gosligo01", "gosligo01", "gosligo01", "gosligo01", "gosligo01", "gosligo01", "gosligo01", "gosligo01", "gosligo01", "gosligo01", "gosligo01", "gosligo01", "gosligo01", "gosligo01", "gosligo01", "gosligo01", "lyonste01", "lyonste01", "lyonste01", "lyonste01", "lyonste01", "lyonste01", "lyonste01",
+#> "lyonste01", "lyonste01", "lyonste01", "lyonste01", "lyonste01", "lyonste01", "lyonste01", "lyonste01", "lyonste01", "lyonste01", "lyonste01", "lyonste01", "lyonste01", "lyonste01", "cuyleki01", "cuyleki01", "cuyleki01", "cuyleki01", "cuyleki01", "cuyleki01", "cuyleki01", "cuyleki01", "cuyleki01", "cuyleki01", "cuyleki01", "cuyleki01", "cuyleki01", "cuyleki01", "cuyleki01", "cuyleki01", "cuyleki01", "cuyleki01", "cuyleki01", "wrighgl01", "wrighgl01", "wrighgl01", "wrighgl01", "wrighgl01", "wrighgl01",
+#> "wrighgl01", "wrighgl01", "wrighgl01", "wrighgl01", "wrighgl01", "bottoji01", "bottoji01", "bottoji01", "bottoji01", "bottoji01", "bottoji01", "bottoji01", "bottoji01", "bottoji01", "bottoji01", "bottoji01", "bottoji01", "bottoji01", "bottoji01", "bottoji01", "bottoji01", "smithea02", "smithea02", "smithea02", "smithea02", "smithea02", "smithea02", "smithea02", "smithea02", "smithea02", "smithea02", "smithea02", "smithea02", "smithea02", "smithea02", "smithea02", "donohpe01", "donohpe01", "donohpe01",
+#> "donohpe01", "donohpe01", "donohpe01", "donohpe01", "donohpe01", "donohpe01", "donohpe01", "donohpe01", "donohpe01", "donohpe01", "donohpe01", "burnsge02", "burnsge02", "burnsge02", "burnsge02", "burnsge02", "burnsge02", "burnsge02", "burnsge02", "burnsge02", "burnsge02", "burnsge02", "burnsge02", "burnsge02", "burnsge02", "burnsge02", "burnsge02", "burnsge02", "burnsge02", "burnsge02", "kammwi01", "kammwi01", "kammwi01", "kammwi01", "kammwi01", "kammwi01", "kammwi01", "kammwi01", "kammwi01", "kammwi01",
+#> "kammwi01", "kammwi01", "kammwi01", "kammwi01", "manushe01", "manushe01", "manushe01", "manushe01", "manushe01", "manushe01", "manushe01", "manushe01", "manushe01", "manushe01", "manushe01", "manushe01", "manushe01", "manushe01", "manushe01", "manushe01", "manushe01", "manushe01", "manushe01", "mostijo01", "mostijo01", "mostijo01", "mostijo01", "mostijo01", "mostijo01", "mostijo01", "mostijo01", "mostijo01", "mostijo01", "grovele01", "grovele01", "grovele01", "grovele01", "grovele01", "grovele01",
+#> "grovele01", "grovele01", "grovele01", "grovele01", "grovele01", "grovele01", "grovele01", "grovele01", "grovele01", "grovele01", "grovele01", "kremera01", "kremera01", "kremera01", "kremera01", "kremera01", "kremera01", "kremera01", "kremera01", "kremera01", "kremera01", "wilsoha01", "wilsoha01", "wilsoha01", "wilsoha01", "wilsoha01", "wilsoha01", "wilsoha01", "wilsoha01", "wilsoha01", "wilsoha01", "wilsoha01", "wilsoha01", "wilsoha01", "carlsha01", "carlsha01", "carlsha01", "carlsha01", "carlsha01",
+#> "carlsha01", "carlsha01", "carlsha01", "carlsha01", "carlsha01", "carlsha01", "carlsha01", "carlsha01", "carlsha01", "carlsha01", "pettyje01", "pettyje01", "pettyje01", "pettyje01", "pettyje01", "pettyje01", "pettyje01", "pettyje01", "gehrilo01", "gehrilo01", "gehrilo01", "gehrilo01", "gehrilo01", "gehrilo01", "gehrilo01", "gehrilo01", "gehrilo01", "gehrilo01", "gehrilo01", "gehrilo01", "gehrilo01", "gehrilo01", "gehrilo01", "gehrilo01", "gehrilo01", "lazzeto01", "lazzeto01", "lazzeto01", "lazzeto01",
+#> "lazzeto01", "lazzeto01", "lazzeto01", "lazzeto01", "lazzeto01", "lazzeto01", "lazzeto01", "lazzeto01", "lazzeto01", "lazzeto01", "lazzeto01", "hoytwa01", "hoytwa01", "hoytwa01", "hoytwa01", "hoytwa01", "hoytwa01", "hoytwa01", "hoytwa01", "hoytwa01", "hoytwa01", "hoytwa01", "hoytwa01", "hoytwa01", "hoytwa01", "hoytwa01", "hoytwa01", "hoytwa01", "hoytwa01", "hoytwa01", "hoytwa01", "hoytwa01", "hoytwa01", "hoytwa01", "hoytwa01", "hoytwa01", "thomato02", "thomato02", "thomato02", "thomato02", "thomato02",
+#> "thomato02", "thomato02", "thomato02", "thomato02", "thomato02", "thomato02", "thomato02", "thomato02", "thomato02", "thomato02", "rootch01", "rootch01", "rootch01", "rootch01", "rootch01", "rootch01", "rootch01", "rootch01", "rootch01", "rootch01", "rootch01", "rootch01", "rootch01", "rootch01", "rootch01", "rootch01", "rootch01", "haineje01", "haineje01", "haineje01", "haineje01", "haineje01", "haineje01", "haineje01", "haineje01", "haineje01", "haineje01", "haineje01", "haineje01", "haineje01",
+#> "haineje01", "haineje01", "haineje01", "haineje01", "haineje01", "haineje01", "wanerpa01", "wanerpa01", "wanerpa01", "wanerpa01", "wanerpa01", "wanerpa01", "wanerpa01", "wanerpa01", "wanerpa01", "wanerpa01", "wanerpa01", "wanerpa01", "wanerpa01", "wanerpa01", "wanerpa01", "wanerpa01", "wanerpa01", "wanerpa01", "wanerpa01", "wanerpa01", "wanerpa01", "wanerpa01", "terrybi01", "terrybi01", "terrybi01", "terrybi01", "terrybi01", "terrybi01", "terrybi01", "terrybi01", "terrybi01", "terrybi01", "terrybi01",
+#> "terrybi01", "terrybi01", "terrybi01", "wilsoji01", "wilsoji01", "wilsoji01", "wilsoji01", "wilsoji01", "wilsoji01", "wilsoji01", "wilsoji01", "wilsoji01", "wilsoji01", "wilsoji01", "wilsoji01", "wilsoji01", "wilsoji01", "wilsoji01", "wilsoji01", "wilsoji01", "wilsoji01", "wilsoji01", "wanerll01", "wanerll01", "wanerll01", "wanerll01", "wanerll01", "wanerll01", "wanerll01", "wanerll01", "wanerll01", "wanerll01", "wanerll01", "wanerll01", "wanerll01", "wanerll01", "wanerll01", "wanerll01", "wanerll01",
+#> "wanerll01", "wanerll01", "wanerll01", "wanerll01", "crowdal01", "crowdal01", "crowdal01", "crowdal01", "crowdal01", "crowdal01", "crowdal01", "crowdal01", "crowdal01", "crowdal01", "crowdal01", "crowdal01", "crowdal01", "crowdal01", "morried02", "morried02", "morried02", "morried02", "morried02", "bentola01", "bentola01", "bentola01", "bentola01", "bentola01", "bentola01", "bentola01", "bentola01", "bentola01", "bentola01", "bentola01", "bentola01", "bentola01", "bentola01", "bentola01", "hafeych01",
+#> "hafeych01", "hafeych01", "hafeych01", "hafeych01", "hafeych01", "hafeych01", "hafeych01", "hafeych01", "hafeych01", "hafeych01", "hafeych01", "hafeych01", "sherdbi01", "sherdbi01", "sherdbi01", "sherdbi01", "sherdbi01", "sherdbi01", "sherdbi01", "sherdbi01", "sherdbi01", "sherdbi01", "sherdbi01", "sherdbi01", "sherdbi01", "sherdbi01", "sherdbi01", "sherdbi01", "sherdbi01", "lindsfr01", "lindsfr01", "lindsfr01", "lindsfr01", "lindsfr01", "lindsfr01", "lindsfr01", "lindsfr01", "lindsfr01", "lindsfr01",
+#> "lindsfr01", "lindsfr01", "lindsfr01", "fonsele01", "fonsele01", "fonsele01", "fonsele01", "fonsele01", "fonsele01", "fonsele01", "fonsele01", "fonsele01", "fonsele01", "fonsele01", "fonsele01", "fonsele01", "gehrich01", "gehrich01", "gehrich01", "gehrich01", "gehrich01", "gehrich01", "gehrich01", "gehrich01", "gehrich01", "gehrich01", "gehrich01", "gehrich01", "gehrich01", "gehrich01", "gehrich01", "gehrich01", "gehrich01", "gehrich01", "gehrich01", "dykesji01", "dykesji01", "dykesji01", "dykesji01",
+#> "dykesji01", "dykesji01", "dykesji01", "dykesji01", "dykesji01", "dykesji01", "dykesji01", "dykesji01", "dykesji01", "dykesji01", "dykesji01", "dykesji01", "dykesji01", "dykesji01", "dykesji01", "dykesji01", "dykesji01", "dykesji01", "combsea01", "combsea01", "combsea01", "combsea01", "combsea01", "combsea01", "combsea01", "combsea01", "combsea01", "combsea01", "combsea01", "combsea01", "earnsge01", "earnsge01", "earnsge01", "earnsge01", "earnsge01", "earnsge01", "earnsge01", "earnsge01", "earnsge01",
+#> "earnsge01", "earnsge01", "graydo02", "graydo02", "graydo02", "graydo02", "graydo02", "graydo02", "graydo02", "graydo02", "graydo02", "graydo02", "ferrewe01", "ferrewe01", "ferrewe01", "ferrewe01", "ferrewe01", "ferrewe01", "ferrewe01", "ferrewe01", "ferrewe01", "ferrewe01", "ferrewe01", "ferrewe01", "ferrewe01", "ferrewe01", "ferrewe01", "ferrewe01", "ferrewe01", "kressre01", "kressre01", "kressre01", "kressre01", "kressre01", "kressre01", "kressre01", "kressre01", "kressre01", "kressre01", "kressre01",
+#> "kressre01", "kressre01", "kressre01", "kressre01", "kressre01", "kressre01", "malonpa02", "malonpa02", "malonpa02", "malonpa02", "malonpa02", "malonpa02", "malonpa02", "malonpa02", "malonpa02", "malonpa02", "lucasre01", "lucasre01", "lucasre01", "lucasre01", "lucasre01", "lucasre01", "lucasre01", "lucasre01", "lucasre01", "lucasre01", "lucasre01", "lucasre01", "lucasre01", "lucasre01", "lucasre01", "lucasre01", "hubbeca01", "hubbeca01", "hubbeca01", "hubbeca01", "hubbeca01", "hubbeca01", "hubbeca01",
+#> "hubbeca01", "hubbeca01", "hubbeca01", "hubbeca01", "hubbeca01", "hubbeca01", "hubbeca01", "hubbeca01", "hubbeca01", "odoulle01", "odoulle01", "odoulle01", "odoulle01", "odoulle01", "odoulle01", "odoulle01", "odoulle01", "odoulle01", "odoulle01", "odoulle01", "odoulle01", "foxxji01", "foxxji01", "foxxji01", "foxxji01", "foxxji01", "foxxji01", "foxxji01", "foxxji01", "foxxji01", "foxxji01", "foxxji01", "foxxji01", "foxxji01", "foxxji01", "foxxji01", "foxxji01", "foxxji01", "foxxji01", "foxxji01",
+#> "foxxji01", "foxxji01", "averiea01", "averiea01", "averiea01", "averiea01", "averiea01", "averiea01", "averiea01", "averiea01", "averiea01", "averiea01", "averiea01", "averiea01", "averiea01", "averiea01", "cronijo01", "cronijo01", "cronijo01", "cronijo01", "cronijo01", "cronijo01", "cronijo01", "cronijo01", "cronijo01", "cronijo01", "cronijo01", "cronijo01", "cronijo01", "cronijo01", "cronijo01", "cronijo01", "cronijo01", "cronijo01", "cronijo01", "cronijo01", "hallabi01", "hallabi01", "hallabi01",
+#> "hallabi01", "hallabi01", "hallabi01", "hallabi01", "hallabi01", "hallabi01", "hallabi01", "hallabi01", "hallabi01", "hallabi01", "melilsk01", "melilsk01", "melilsk01", "melilsk01", "melilsk01", "melilsk01", "melilsk01", "melilsk01", "melilsk01", "melilsk01", "melilsk01", "melilsk01", "melilsk01", "walberu01", "walberu01", "walberu01", "walberu01", "walberu01", "walberu01", "walberu01", "walberu01", "walberu01", "walberu01", "walberu01", "walberu01", "walberu01", "walberu01", "walberu01", "walberu01",
+#> "branded01", "branded01", "branded01", "branded01", "branded01", "branded01", "branded01", "branded01", "branded01", "branded01", "branded01", "derripa01", "derripa01", "derripa01", "derripa01", "derripa01", "derripa01", "derripa01", "derripa01", "derripa01", "derripa01", "derripa01", "derripa01", "derripa01", "derripa01", "derripa01", "derripa01", "fitzsfr01", "fitzsfr01", "fitzsfr01", "fitzsfr01", "fitzsfr01", "fitzsfr01", "fitzsfr01", "fitzsfr01", "fitzsfr01", "fitzsfr01", "fitzsfr01", "fitzsfr01",
+#> "fitzsfr01", "fitzsfr01", "fitzsfr01", "fitzsfr01", "fitzsfr01", "fitzsfr01", "fitzsfr01", "fitzsfr01", "kleinch01", "kleinch01", "kleinch01", "kleinch01", "kleinch01", "kleinch01", "kleinch01", "kleinch01", "kleinch01", "kleinch01", "kleinch01", "kleinch01", "kleinch01", "kleinch01", "kleinch01", "kleinch01", "kleinch01", "kleinch01", "kleinch01", "gomezle01", "gomezle01", "gomezle01", "gomezle01", "gomezle01", "gomezle01", "gomezle01", "gomezle01", "gomezle01", "gomezle01", "gomezle01", "gomezle01",
+#> "gomezle01", "gomezle01", "warnelo01", "warnelo01", "warnelo01", "warnelo01", "warnelo01", "warnelo01", "warnelo01", "warnelo01", "warnelo01", "warnelo01", "warnelo01", "warnelo01", "warnelo01", "warnelo01", "warnelo01", "warnelo01", "hermabi01", "hermabi01", "hermabi01", "hermabi01", "hermabi01", "hermabi01", "hermabi01", "hermabi01", "hermabi01", "hermabi01", "hermabi01", "hermabi01", "hermabi01", "hermabi01", "hermabi01", "hermabi01", "hermabi01", "clarkwa02", "clarkwa02", "clarkwa02", "clarkwa02",
+#> "clarkwa02", "clarkwa02", "clarkwa02", "clarkwa02", "clarkwa02", "clarkwa02", "clarkwa02", "clarkwa02", "clarkwa02", "clarkwa02", "deandi01", "deandi01", "deandi01", "deandi01", "deandi01", "deandi01", "deandi01", "deandi01", "deandi01", "deandi01", "deandi01", "deandi01", "bartedi01", "bartedi01", "bartedi01", "bartedi01", "bartedi01", "bartedi01", "bartedi01", "bartedi01", "bartedi01", "bartedi01", "bartedi01", "bartedi01", "bartedi01", "bartedi01", "bartedi01", "bartedi01", "bartedi01", "bartedi01",
+#> "bartedi01", "dickebi01", "dickebi01", "dickebi01", "dickebi01", "dickebi01", "dickebi01", "dickebi01", "dickebi01", "dickebi01", "dickebi01", "dickebi01", "dickebi01", "dickebi01", "dickebi01", "dickebi01", "dickebi01", "dickebi01", "higgipi01", "higgipi01", "higgipi01", "higgipi01", "higgipi01", "higgipi01", "higgipi01", "higgipi01", "higgipi01", "higgipi01", "higgipi01", "higgipi01", "higgipi01", "higgipi01", "higgipi01", "westsa01", "westsa01", "westsa01", "westsa01", "westsa01", "westsa01",
+#> "westsa01", "westsa01", "westsa01", "westsa01", "westsa01", "westsa01", "westsa01", "westsa01", "westsa01", "westsa01", "westsa01", "whiteea01", "whiteea01", "whiteea01", "whiteea01", "whiteea01", "whiteea01", "whiteea01", "whiteea01", "whiteea01", "whiteea01", "whiteea01", "whiteea01", "whiteea01", "whiteea01", "whiteea01", "whiteea01", "whiteea01", "bridgto01", "bridgto01", "bridgto01", "bridgto01", "bridgto01", "bridgto01", "bridgto01", "bridgto01", "bridgto01", "bridgto01", "bridgto01", "bridgto01",
+#> "bridgto01", "bridgto01", "bridgto01", "bridgto01", "bergewa01", "bergewa01", "bergewa01", "bergewa01", "bergewa01", "bergewa01", "bergewa01", "bergewa01", "bergewa01", "bergewa01", "bergewa01", "bergewa01", "bergewa01", "bergewa01", "lopezal01", "lopezal01", "lopezal01", "lopezal01", "lopezal01", "lopezal01", "lopezal01", "lopezal01", "lopezal01", "lopezal01", "lopezal01", "lopezal01", "lopezal01", "lopezal01", "lopezal01", "lopezal01", "lopezal01", "lopezal01", "lopezal01", "lopezal01", "medwijo01",
+#> "medwijo01", "medwijo01", "medwijo01", "medwijo01", "medwijo01", "medwijo01", "medwijo01", "medwijo01", "medwijo01", "medwijo01", "medwijo01", "medwijo01", "medwijo01", "medwijo01", "medwijo01", "medwijo01", "medwijo01", "medwijo01", "medwijo01", "cantwbe01", "cantwbe01", "cantwbe01", "cantwbe01", "cantwbe01", "cantwbe01", "cantwbe01", "cantwbe01", "cantwbe01", "cantwbe01", "cantwbe01", "cantwbe01", "cantwbe01", "vaughar01", "vaughar01", "vaughar01", "vaughar01", "vaughar01", "vaughar01", "vaughar01",
+#> "vaughar01", "vaughar01", "vaughar01", "vaughar01", "vaughar01", "vaughar01", "vaughar01", "werbebi01", "werbebi01", "werbebi01", "werbebi01", "werbebi01", "werbebi01", "werbebi01", "werbebi01", "werbebi01", "werbebi01", "werbebi01", "werbebi01", "rowesc01", "rowesc01", "rowesc01", "rowesc01", "rowesc01", "rowesc01", "rowesc01", "rowesc01", "rowesc01", "rowesc01", "rowesc01", "rowesc01", "rowesc01", "rowesc01", "rowesc01", "rowesc01", "hardeme01", "hardeme01", "hardeme01", "hardeme01", "hardeme01",
+#> "hardeme01", "hardeme01", "hardeme01", "hardeme01", "hardeme01", "hardeme01", "hardeme01", "hardeme01", "hardeme01", "hardeme01", "hardeme01", "hardeme01", "hardeme01", "hardeme01", "hardeme01", "knickbi01", "knickbi01", "knickbi01", "knickbi01", "knickbi01", "knickbi01", "knickbi01", "knickbi01", "knickbi01", "knickbi01", "ottme01", "ottme01", "ottme01", "ottme01", "ottme01", "ottme01", "ottme01", "ottme01", "ottme01", "ottme01", "ottme01", "ottme01", "ottme01", "ottme01", "ottme01", "ottme01",
+#> "ottme01", "ottme01", "ottme01", "ottme01", "ottme01", "ottme01", "moorejo02", "moorejo02", "moorejo02", "moorejo02", "moorejo02", "moorejo02", "moorejo02", "moorejo02", "moorejo02", "moorejo02", "moorejo02", "moorejo02", "schumha02", "schumha02", "schumha02", "schumha02", "schumha02", "schumha02", "schumha02", "schumha02", "schumha02", "schumha02", "schumha02", "schumha02", "schumha02", "greenha01", "greenha01", "greenha01", "greenha01", "greenha01", "greenha01", "greenha01", "greenha01", "greenha01",
+#> "greenha01", "greenha01", "greenha01", "greenha01", "cramedo01", "cramedo01", "cramedo01", "cramedo01", "cramedo01", "cramedo01", "cramedo01", "cramedo01", "cramedo01", "cramedo01", "cramedo01", "cramedo01", "cramedo01", "cramedo01", "cramedo01", "cramedo01", "cramedo01", "cramedo01", "cramedo01", "cramedo01", "vosmijo01", "vosmijo01", "vosmijo01", "vosmijo01", "vosmijo01", "vosmijo01", "vosmijo01", "vosmijo01", "vosmijo01", "vosmijo01", "vosmijo01", "vosmijo01", "vosmijo01", "foxpe01", "foxpe01",
+#> "foxpe01", "foxpe01", "foxpe01", "foxpe01", "foxpe01", "foxpe01", "foxpe01", "foxpe01", "foxpe01", "foxpe01", "foxpe01", "martipe01", "martipe01", "martipe01", "martipe01", "martipe01", "martipe01", "martipe01", "martipe01", "martipe01", "martipe01", "martipe01", "martipe01", "martipe01", "owenma01", "owenma01", "owenma01", "owenma01", "owenma01", "owenma01", "owenma01", "owenma01", "owenma01", "dimagjo01", "dimagjo01", "dimagjo01", "dimagjo01", "dimagjo01", "dimagjo01", "dimagjo01", "dimagjo01",
+#> "dimagjo01", "dimagjo01", "dimagjo01", "dimagjo01", "dimagjo01", "kenneve01", "kenneve01", "kenneve01", "kenneve01", "kenneve01", "kenneve01", "kenneve01", "kenneve01", "kenneve01", "kenneve01", "kenneve01", "kenneve01", "kenneve01", "kenneve01", "kenneve01", "kenneve01", "allenjo02", "allenjo02", "allenjo02", "allenjo02", "allenjo02", "allenjo02", "allenjo02", "allenjo02", "allenjo02", "allenjo02", "allenjo02", "allenjo02", "allenjo02", "allenjo02", "allenjo02", "moseswa01", "moseswa01", "moseswa01",
+#> "moseswa01", "moseswa01", "moseswa01", "moseswa01", "moseswa01", "moseswa01", "moseswa01", "moseswa01", "moseswa01", "moseswa01", "moseswa01", "moseswa01", "moseswa01", "moseswa01", "moseswa01", "applilu01", "applilu01", "applilu01", "applilu01", "applilu01", "applilu01", "applilu01", "applilu01", "applilu01", "applilu01", "applilu01", "applilu01", "applilu01", "applilu01", "applilu01", "applilu01", "applilu01", "applilu01", "applilu01", "applilu01", "hackst01", "hackst01", "hackst01", "hackst01",
+#> "hackst01", "hackst01", "hackst01", "hackst01", "hackst01", "hackst01", "hackst01", "hackst01", "hackst01", "hackst01", "hackst01", "hackst01", "suhrgu01", "suhrgu01", "suhrgu01", "suhrgu01", "suhrgu01", "suhrgu01", "suhrgu01", "suhrgu01", "suhrgu01", "suhrgu01", "suhrgu01", "suhrgu01", "frencla01", "frencla01", "frencla01", "frencla01", "frencla01", "frencla01", "frencla01", "frencla01", "frencla01", "frencla01", "frencla01", "frencla01", "frencla01", "frencla01", "frencla01", "macfada01", "macfada01",
+#> "macfada01", "macfada01", "macfada01", "macfada01", "macfada01", "macfada01", "macfada01", "macfada01", "macfada01", "macfada01", "macfada01", "macfada01", "macfada01", "macfada01", "macfada01", "macfada01", "macfada01", "lawsoro01", "lawsoro01", "lawsoro01", "lawsoro01", "lawsoro01", "lawsoro01", "lawsoro01", "lawsoro01", "lawsoro01", "lawsoro01", "whitnpi01", "whitnpi01", "whitnpi01", "whitnpi01", "whitnpi01", "whitnpi01", "whitnpi01", "whitnpi01", "whitnpi01", "whitnpi01", "whitnpi01", "whitnpi01",
+#> "whitnpi01", "whitnpi01", "fettelo01", "fettelo01", "fettelo01", "fettelo01", "fettelo01", "fettelo01", "mizejo01", "mizejo01", "mizejo01", "mizejo01", "mizejo01", "mizejo01", "mizejo01", "mizejo01", "mizejo01", "mizejo01", "mizejo01", "mizejo01", "mizejo01", "mizejo01", "mizejo01", "mizejo01", "demarfr02", "demarfr02", "demarfr02", "demarfr02", "demarfr02", "demarfr02", "demarfr02", "demarfr02", "demarfr02", "demarfr02", "demarfr02", "demarfr02", "demarfr02", "turneji01", "turneji01", "turneji01",
+#> "turneji01", "turneji01", "turneji01", "turneji01", "turneji01", "turneji01", "turneji01", "rolfere01", "rolfere01", "rolfere01", "rolfere01", "rolfere01", "rolfere01", "rolfere01", "rolfere01", "rolfere01", "rolfere01", "ruffire01", "ruffire01", "ruffire01", "ruffire01", "ruffire01", "ruffire01", "ruffire01", "ruffire01", "ruffire01", "ruffire01", "ruffire01", "ruffire01", "ruffire01", "ruffire01", "ruffire01", "ruffire01", "ruffire01", "ruffire01", "ruffire01", "ruffire01", "ruffire01", "ruffire01",
+#> "ruffire01", "hemslro01", "hemslro01", "hemslro01", "hemslro01", "hemslro01", "hemslro01", "hemslro01", "hemslro01", "hemslro01", "hemslro01", "hemslro01", "hemslro01", "hemslro01", "hemslro01", "hemslro01", "hemslro01", "hemslro01", "hemslro01", "hemslro01", "hemslro01", "hemslro01", "hemslro01", "heathje01", "heathje01", "heathje01", "heathje01", "heathje01", "heathje01", "heathje01", "heathje01", "heathje01", "heathje01", "heathje01", "heathje01", "heathje01", "heathje01", "heathje01", "newsobo01",
+#> "newsobo01", "newsobo01", "newsobo01", "newsobo01", "newsobo01", "newsobo01", "newsobo01", "newsobo01", "newsobo01", "newsobo01", "newsobo01", "newsobo01", "newsobo01", "newsobo01", "newsobo01", "newsobo01", "newsobo01", "newsobo01", "newsobo01", "newsobo01", "newsobo01", "newsobo01", "newsobo01", "newsobo01", "newsobo01", "newsobo01", "newsobo01", "newsobo01", "vandejo01", "vandejo01", "vandejo01", "vandejo01", "vandejo01", "vandejo01", "vandejo01", "vandejo01", "vandejo01", "vandejo01", "vandejo01",
+#> "vandejo01", "vandejo01", "mccorfr01", "mccorfr01", "mccorfr01", "mccorfr01", "mccorfr01", "mccorfr01", "mccorfr01", "mccorfr01", "mccorfr01", "mccorfr01", "mccorfr01", "mccorfr01", "mccorfr01", "mccorfr01", "lombaer01", "lombaer01", "lombaer01", "lombaer01", "lombaer01", "lombaer01", "lombaer01", "lombaer01", "lombaer01", "lombaer01", "lombaer01", "lombaer01", "lombaer01", "lombaer01", "lombaer01", "lombaer01", "lombaer01", "danniha01", "danniha01", "danniha01", "danniha01", "danniha01", "danniha01",
+#> "danniha01", "danniha01", "danniha01", "danniha01", "leebi02", "leebi02", "leebi02", "leebi02", "leebi02", "leebi02", "leebi02", "leebi02", "leebi02", "leebi02", "leebi02", "leebi02", "leebi02", "leebi02", "leebi02", "leebi02", "goodmiv01", "goodmiv01", "goodmiv01", "goodmiv01", "goodmiv01", "goodmiv01", "goodmiv01", "goodmiv01", "goodmiv01", "goodmiv01", "gordojo01", "gordojo01", "gordojo01", "gordojo01", "gordojo01", "gordojo01", "gordojo01", "gordojo01", "gordojo01", "gordojo01", "gordojo01",
+#> "johnsbo01", "johnsbo01", "johnsbo01", "johnsbo01", "johnsbo01", "johnsbo01", "johnsbo01", "johnsbo01", "johnsbo01", "johnsbo01", "johnsbo01", "johnsbo01", "johnsbo01", "fellebo01", "fellebo01", "fellebo01", "fellebo01", "fellebo01", "fellebo01", "fellebo01", "fellebo01", "fellebo01", "fellebo01", "fellebo01", "fellebo01", "fellebo01", "fellebo01", "fellebo01", "fellebo01", "fellebo01", "fellebo01", "leonadu02", "leonadu02", "leonadu02", "leonadu02", "leonadu02", "leonadu02", "leonadu02", "leonadu02",
+#> "leonadu02", "leonadu02", "leonadu02", "leonadu02", "leonadu02", "leonadu02", "leonadu02", "leonadu02", "leonadu02", "leonadu02", "leonadu02", "leonadu02", "willite01", "willite01", "willite01", "willite01", "willite01", "willite01", "willite01", "willite01", "willite01", "willite01", "willite01", "willite01", "willite01", "willite01", "willite01", "willite01", "willite01", "willite01", "willite01", "waltebu01", "waltebu01", "waltebu01", "waltebu01", "waltebu01", "waltebu01", "waltebu01", "waltebu01",
+#> "waltebu01", "waltebu01", "waltebu01", "waltebu01", "waltebu01", "waltebu01", "waltebu01", "waltebu01", "waltebu01", "waltebu01", "waltebu01", "waltebu01", "waltebu01", "daviscu01", "daviscu01", "daviscu01", "daviscu01", "daviscu01", "daviscu01", "daviscu01", "daviscu01", "daviscu01", "daviscu01", "daviscu01", "daviscu01", "daviscu01", "daviscu01", "daviscu01", "freylo01", "freylo01", "freylo01", "freylo01", "freylo01", "freylo01", "freylo01", "freylo01", "freylo01", "freylo01", "freylo01", "freylo01",
+#> "freylo01", "freylo01", "freylo01", "freylo01", "lavagco01", "lavagco01", "lavagco01", "lavagco01", "lavagco01", "lavagco01", "lavagco01", "lavagco01", "lavagco01", "lavagco01", "leibeha01", "leibeha01", "leibeha01", "leibeha01", "leibeha01", "leibeha01", "leibeha01", "leibeha01", "leibeha01", "leibeha01", "cliftha01", "cliftha01", "cliftha01", "cliftha01", "cliftha01", "cliftha01", "cliftha01", "cliftha01", "cliftha01", "cliftha01", "cliftha01", "cliftha01", "cliftha01", "hayesfr01", "hayesfr01",
+#> "hayesfr01", "hayesfr01", "hayesfr01", "hayesfr01", "hayesfr01", "hayesfr01", "hayesfr01", "hayesfr01", "hayesfr01", "hayesfr01", "hayesfr01", "hayesfr01", "hayesfr01", "hayesfr01", "hayesfr01", "kellech01", "kellech01", "kellech01", "kellech01", "kellech01", "kellech01", "kellech01", "kellech01", "kellech01", "kellech01", "kellech01", "kellech01", "kellech01", "nichobi01", "nichobi01", "nichobi01", "nichobi01", "nichobi01", "nichobi01", "nichobi01", "nichobi01", "nichobi01", "nichobi01", "nichobi01",
+#> "nichobi01", "nichobi01", "nichobi01", "nichobi01", "nichobi01", "milleed03", "milleed03", "milleed03", "milleed03", "milleed03", "milleed03", "milleed03", "milleed03", "milleed03", "milleed03", "milleed03", "milleed03", "milleed03", "milleed03", "taborji01", "taborji01", "taborji01", "taborji01", "taborji01", "taborji01", "taborji01", "taborji01", "taborji01", "leeth01", "leeth01", "leeth01", "leeth01", "leeth01", "leeth01", "leeth01", "leeth01", "leeth01", "leeth01", "leeth01", "leeth01", "leeth01",
+#> "leeth01", "leeth01", "leeth01", "newsodi01", "newsodi01", "newsodi01", "travice01", "travice01", "travice01", "travice01", "travice01", "travice01", "travice01", "travice01", "travice01", "travice01", "travice01", "travice01", "camildo01", "camildo01", "camildo01", "camildo01", "camildo01", "camildo01", "camildo01", "camildo01", "camildo01", "camildo01", "camildo01", "camildo01", "camildo01", "brownji03", "brownji03", "brownji03", "brownji03", "brownji03", "brownji03", "brownji03", "brownji03",
+#> "wyattwh01", "wyattwh01", "wyattwh01", "wyattwh01", "wyattwh01", "wyattwh01", "wyattwh01", "wyattwh01", "wyattwh01", "wyattwh01", "wyattwh01", "wyattwh01", "wyattwh01", "wyattwh01", "wyattwh01", "wyattwh01", "wyattwh01", "whiteer01", "whiteer01", "whiteer01", "whiteer01", "whiteer01", "whiteer01", "whiteer01", "riddlel01", "riddlel01", "riddlel01", "riddlel01", "riddlel01", "riddlel01", "riddlel01", "riddlel01", "riddlel01", "riddlel01", "crespcr01", "crespcr01", "crespcr01", "crespcr01", "crespcr01",
+#> "reisepe01", "reisepe01", "reisepe01", "reisepe01", "reisepe01", "reisepe01", "reisepe01", "reisepe01", "reisepe01", "reisepe01", "higbeki01", "higbeki01", "higbeki01", "higbeki01", "higbeki01", "higbeki01", "higbeki01", "higbeki01", "higbeki01", "higbeki01", "higbeki01", "higbeki01", "higbeki01", "higbeki01", "higbeki01", "slaugen01", "slaugen01", "slaugen01", "slaugen01", "slaugen01", "slaugen01", "slaugen01", "slaugen01", "slaugen01", "slaugen01", "slaugen01", "slaugen01", "slaugen01", "slaugen01",
+#> "slaugen01", "slaugen01", "slaugen01", "slaugen01", "slaugen01", "slaugen01", "slaugen01", "slaugen01", "jurgebi01", "jurgebi01", "jurgebi01", "jurgebi01", "jurgebi01", "jurgebi01", "jurgebi01", "jurgebi01", "jurgebi01", "jurgebi01", "jurgebi01", "jurgebi01", "jurgebi01", "jurgebi01", "jurgebi01", "jurgebi01", "jurgebi01", "hassebu01", "hassebu01", "hassebu01", "hassebu01", "hassebu01", "hassebu01", "hassebu01", "keltnke01", "keltnke01", "keltnke01", "keltnke01", "keltnke01", "keltnke01", "keltnke01",
+#> "keltnke01", "keltnke01", "keltnke01", "keltnke01", "keltnke01", "keltnke01", "hughste01", "hughste01", "hughste01", "hughste01", "hughste01", "hughste01", "hughste01", "hughste01", "bonhati01", "bonhati01", "bonhati01", "bonhati01", "bonhati01", "bonhati01", "bonhati01", "bonhati01", "bonhati01", "bonhati01", "bagbyji02", "bagbyji02", "bagbyji02", "bagbyji02", "bagbyji02", "bagbyji02", "bagbyji02", "bagbyji02", "bagbyji02", "bagbyji02", "marchph01", "marchph01", "marchph01", "marchph01", "marchph01",
+#> "marchph01", "marchph01", "marchph01", "marchph01", "chandsp01", "chandsp01", "chandsp01", "chandsp01", "chandsp01", "chandsp01", "chandsp01", "chandsp01", "chandsp01", "chandsp01", "chandsp01", "spencst01", "spencst01", "spencst01", "spencst01", "spencst01", "spencst01", "spencst01", "spencst01", "spencst01", "spencst01", "stephve01", "stephve01", "stephve01", "stephve01", "stephve01", "stephve01", "stephve01", "stephve01", "stephve01", "stephve01", "stephve01", "stephve01", "stephve01", "stephve01",
+#> "stephve01", "stephve01", "stephve01", "coopemo01", "coopemo01", "coopemo01", "coopemo01", "coopemo01", "coopemo01", "coopemo01", "coopemo01", "coopemo01", "coopemo01", "coopemo01", "coopemo01", "coopemo01", "hugheto04", "hugheto04", "hugheto04", "hugheto04", "hugheto04", "beazljo01", "beazljo01", "beazljo01", "beazljo01", "beazljo01", "beazljo01", "marioma01", "marioma01", "marioma01", "marioma01", "marioma01", "marioma01", "marioma01", "marioma01", "marioma01", "marioma01", "marioma01", "marioma01",
+#> "marioma01", "owenmi01", "owenmi01", "owenmi01", "owenmi01", "owenmi01", "owenmi01", "owenmi01", "owenmi01", "owenmi01", "owenmi01", "owenmi01", "owenmi01", "owenmi01", "peskyjo01", "peskyjo01", "peskyjo01", "peskyjo01", "peskyjo01", "peskyjo01", "peskyjo01", "peskyjo01", "peskyjo01", "peskyjo01", "peskyjo01", "peskyjo01", "yorkru01", "yorkru01", "yorkru01", "yorkru01", "yorkru01", "yorkru01", "yorkru01", "yorkru01", "yorkru01", "yorkru01", "yorkru01", "yorkru01", "yorkru01", "yorkru01", "johnsbi03",
+#> "johnsbi03", "johnsbi03", "johnsbi03", "johnsbi03", "johnsbi03", "johnsbi03", "johnsbi03", "johnsbi03", "johnsbi03", "troutdi01", "troutdi01", "troutdi01", "troutdi01", "troutdi01", "troutdi01", "troutdi01", "troutdi01", "troutdi01", "troutdi01", "troutdi01", "troutdi01", "troutdi01", "troutdi01", "troutdi01", "troutdi01", "smithal03", "smithal03", "smithal03", "smithal03", "smithal03", "smithal03", "smithal03", "smithal03", "smithal03", "smithal03", "smithal03", "smithal03", "wakefdi01", "wakefdi01",
+#> "wakefdi01", "wakefdi01", "wakefdi01", "wakefdi01", "wakefdi01", "wakefdi01", "wakefdi01", "musiast01", "musiast01", "musiast01", "musiast01", "musiast01", "musiast01", "musiast01", "musiast01", "musiast01", "musiast01", "musiast01", "musiast01", "musiast01", "musiast01", "musiast01", "musiast01", "musiast01", "musiast01", "musiast01", "musiast01", "musiast01", "musiast01", "sewelri01", "sewelri01", "sewelri01", "sewelri01", "sewelri01", "sewelri01", "sewelri01", "sewelri01", "sewelri01", "sewelri01",
+#> "sewelri01", "sewelri01", "sewelri01", "coopewa01", "coopewa01", "coopewa01", "coopewa01", "coopewa01", "coopewa01", "coopewa01", "coopewa01", "coopewa01", "coopewa01", "coopewa01", "coopewa01", "coopewa01", "coopewa01", "coopewa01", "coopewa01", "coopewa01", "coopewa01", "coopewa01", "coopewa01", "coopewa01", "dimagvi01", "dimagvi01", "dimagvi01", "dimagvi01", "dimagvi01", "dimagvi01", "dimagvi01", "dimagvi01", "dimagvi01", "dimagvi01", "dimagvi01", "dimagvi01", "stirnsn01", "stirnsn01", "stirnsn01",
+#> "stirnsn01", "stirnsn01", "stirnsn01", "stirnsn01", "stirnsn01", "stirnsn01", "stirnsn01", "stirnsn01", "newhoha01", "newhoha01", "newhoha01", "newhoha01", "newhoha01", "newhoha01", "newhoha01", "newhoha01", "newhoha01", "newhoha01", "newhoha01", "newhoha01", "newhoha01", "newhoha01", "newhoha01", "newhoha01", "newhoha01", "elliobo01", "elliobo01", "elliobo01", "elliobo01", "elliobo01", "elliobo01", "elliobo01", "elliobo01", "elliobo01", "elliobo01", "elliobo01", "elliobo01", "elliobo01", "elliobo01",
+#> "elliobo01", "elliobo01", "sandera01", "sandera01", "sandera01", "sandera01", "sandera01", "sandera01", "sandera01", "verbaem01", "verbaem01", "verbaem01", "verbaem01", "verbaem01", "verbaem01", "verbaem01", "verbaem01", "verbaem01", "verbaem01", "voisebi01", "voisebi01", "voisebi01", "voisebi01", "voisebi01", "voisebi01", "voisebi01", "voisebi01", "voisebi01", "voisebi01", "doerrbo01", "doerrbo01", "doerrbo01", "doerrbo01", "doerrbo01", "doerrbo01", "doerrbo01", "doerrbo01", "doerrbo01", "doerrbo01",
+#> "doerrbo01", "doerrbo01", "doerrbo01", "doerrbo01", "walkedi02", "walkedi02", "walkedi02", "walkedi02", "walkedi02", "walkedi02", "walkedi02", "walkedi02", "walkedi02", "walkedi02", "walkedi02", "walkedi02", "walkedi02", "walkedi02", "walkedi02", "walkedi02", "walkedi02", "walkedi02", "walkedi02", "walkedi02", "ettenni01", "ettenni01", "ettenni01", "ettenni01", "ettenni01", "ettenni01", "ettenni01", "ettenni01", "ettenni01", "cuccito01", "cuccito01", "cuccito01", "cuccito01", "cuccito01", "cuccito01",
+#> "cuccito01", "cuccito01", "cuccito01", "cuccito01", "cuccito01", "cuccito01", "cuccito01", "cuccito01", "cuccito01", "cuccito01", "cuccito01", "richapa01", "richapa01", "richapa01", "richapa01", "richapa01", "richapa01", "richapa01", "richapa01", "richapa01", "ferrida01", "ferrida01", "ferrida01", "ferrida01", "ferrida01", "ferrida01", "gromest01", "gromest01", "gromest01", "gromest01", "gromest01", "gromest01", "gromest01", "gromest01", "gromest01", "gromest01", "gromest01", "gromest01", "gromest01",
+#> "gromest01", "gromest01", "gromest01", "gromest01", "gromest01", "wolffro01", "wolffro01", "wolffro01", "wolffro01", "wolffro01", "wolffro01", "wolffro01", "wolffro01", "cullero01", "cullero01", "cullero01", "cullero01", "cullero01", "cullero01", "cullero01", "cullero01", "cullero01", "cullero01", "cullero01", "cullero01", "cullero01", "cullero01", "cavarph01", "cavarph01", "cavarph01", "cavarph01", "cavarph01", "cavarph01", "cavarph01", "cavarph01", "cavarph01", "cavarph01", "cavarph01", "cavarph01",
+#> "cavarph01", "cavarph01", "cavarph01", "cavarph01", "cavarph01", "cavarph01", "cavarph01", "cavarph01", "cavarph01", "cavarph01", "kurowwh01", "kurowwh01", "kurowwh01", "kurowwh01", "kurowwh01", "kurowwh01", "kurowwh01", "kurowwh01", "kurowwh01", "pafkoan01", "pafkoan01", "pafkoan01", "pafkoan01", "pafkoan01", "pafkoan01", "pafkoan01", "pafkoan01", "pafkoan01", "pafkoan01", "pafkoan01", "pafkoan01", "pafkoan01", "pafkoan01", "pafkoan01", "pafkoan01", "pafkoan01", "pafkoan01", "brechha01", "brechha01",
+#> "brechha01", "brechha01", "brechha01", "brechha01", "brechha01", "brechha01", "brechha01", "brechha01", "brechha01", "brechha01", "borowha01", "borowha01", "borowha01", "borowha01", "borowha01", "borowha01", "borowha01", "borowha01", "borowha01", "borowha01", "borowha01", "borowha01", "borowha01", "holmeto01", "holmeto01", "holmeto01", "holmeto01", "holmeto01", "holmeto01", "holmeto01", "holmeto01", "holmeto01", "holmeto01", "holmeto01", "barrere01", "barrere01", "barrere01", "barrere01", "barrere01",
+#> "barrere01", "barrere01", "barrere01", "barrere01", "barrere01", "barrere01", "barrere01", "wyseha01", "wyseha01", "wyseha01", "wyseha01", "wyseha01", "wyseha01", "wyseha01", "wyseha01", "wyseha01", "rosengo01", "rosengo01", "rosengo01", "rosengo01", "rosengo01", "rosengo01", "rosengo01", "mayoed01", "mayoed01", "mayoed01", "mayoed01", "mayoed01", "mayoed01", "mayoed01", "mayoed01", "mayoed01", "vernomi01", "vernomi01", "vernomi01", "vernomi01", "vernomi01", "vernomi01", "vernomi01", "vernomi01",
+#> "vernomi01", "vernomi01", "vernomi01", "vernomi01", "vernomi01", "vernomi01", "vernomi01", "vernomi01", "vernomi01", "vernomi01", "vernomi01", "vernomi01", "vernomi01", "kellge01", "kellge01", "kellge01", "kellge01", "kellge01", "kellge01", "kellge01", "kellge01", "kellge01", "kellge01", "kellge01", "kellge01", "kellge01", "kellge01", "kellge01", "kellge01", "kellge01", "kellge01", "kellge01", "robinaa01", "robinaa01", "robinaa01", "robinaa01", "robinaa01", "robinaa01", "robinaa01", "robinaa01",
+#> "robinaa01", "boudrlo01", "boudrlo01", "boudrlo01", "boudrlo01", "boudrlo01", "boudrlo01", "boudrlo01", "boudrlo01", "boudrlo01", "boudrlo01", "boudrlo01", "boudrlo01", "boudrlo01", "boudrlo01", "boudrlo01", "polleho01", "polleho01", "polleho01", "polleho01", "polleho01", "polleho01", "polleho01", "polleho01", "polleho01", "polleho01", "polleho01", "polleho01", "polleho01", "polleho01", "polleho01", "polleho01", "polleho01", "stanked01", "stanked01", "stanked01", "stanked01", "stanked01", "stanked01",
+#> "stanked01", "stanked01", "stanked01", "stanked01", "stanked01", "stanked01", "mcculcl01", "mcculcl01", "mcculcl01", "mcculcl01", "mcculcl01", "mcculcl01", "mcculcl01", "mcculcl01", "mcculcl01", "mcculcl01", "mcculcl01", "mcculcl01", "mcculcl01", "mcculcl01", "mcculcl01", "ennisde01", "ennisde01", "ennisde01", "ennisde01", "ennisde01", "ennisde01", "ennisde01", "ennisde01", "ennisde01", "ennisde01", "ennisde01", "ennisde01", "ennisde01", "ennisde01", "ennisde01", "sainjo01", "sainjo01", "sainjo01",
+#> "sainjo01", "sainjo01", "sainjo01", "sainjo01", "sainjo01", "sainjo01", "sainjo01", "sainjo01", "sainjo01", "sainjo01", "reesepe01", "reesepe01", "reesepe01", "reesepe01", "reesepe01", "reesepe01", "reesepe01", "reesepe01", "reesepe01", "reesepe01", "reesepe01", "reesepe01", "reesepe01", "reesepe01", "reesepe01", "reesepe01", "dimagdo01", "dimagdo01", "dimagdo01", "dimagdo01", "dimagdo01", "dimagdo01", "dimagdo01", "dimagdo01", "dimagdo01", "dimagdo01", "dimagdo01", "mcquige02", "mcquige02", "mcquige02",
+#> "mcquige02", "mcquige02", "mcquige02", "mcquige02", "mcquige02", "mcquige02", "mcquige02", "mcquige02", "mcquige02", "berrayo01", "berrayo01", "berrayo01", "berrayo01", "berrayo01", "berrayo01", "berrayo01", "berrayo01", "berrayo01", "berrayo01", "berrayo01", "berrayo01", "berrayo01", "berrayo01", "berrayo01", "berrayo01", "berrayo01", "berrayo01", "berrayo01", "reynoal01", "reynoal01", "reynoal01", "reynoal01", "reynoal01", "reynoal01", "reynoal01", "reynoal01", "reynoal01", "reynoal01", "reynoal01",
+#> "reynoal01", "reynoal01", "henrito01", "henrito01", "henrito01", "henrito01", "henrito01", "henrito01", "henrito01", "henrito01", "henrito01", "henrito01", "henrito01", "edwarbr01", "edwarbr01", "edwarbr01", "edwarbr01", "edwarbr01", "edwarbr01", "edwarbr01", "edwarbr01", "edwarbr01", "edwarbr01", "edwarbr01", "blackew01", "blackew01", "blackew01", "blackew01", "blackew01", "blackew01", "blackew01", "blackew01", "blackew01", "blackew01", "blackew01", "kinerra01", "kinerra01", "kinerra01", "kinerra01",
+#> "kinerra01", "kinerra01", "kinerra01", "kinerra01", "kinerra01", "kinerra01", "kinerra01", "brancra01", "brancra01", "brancra01", "brancra01", "brancra01", "brancra01", "brancra01", "brancra01", "brancra01", "brancra01", "brancra01", "brancra01", "brancra01", "brancra01", "spahnwa01", "spahnwa01", "spahnwa01", "spahnwa01", "spahnwa01", "spahnwa01", "spahnwa01", "spahnwa01", "spahnwa01", "spahnwa01", "spahnwa01", "spahnwa01", "spahnwa01", "spahnwa01", "spahnwa01", "spahnwa01", "spahnwa01", "spahnwa01",
+#> "spahnwa01", "spahnwa01", "spahnwa01", "spahnwa01", "marshwi01", "marshwi01", "marshwi01", "marshwi01", "marshwi01", "marshwi01", "marshwi01", "marshwi01", "marshwi01", "marshwi01", "marshwi01", "marshwi01", "robinja02", "robinja02", "robinja02", "robinja02", "robinja02", "robinja02", "robinja02", "robinja02", "robinja02", "robinja02", "fainfe01", "fainfe01", "fainfe01", "fainfe01", "fainfe01", "fainfe01", "fainfe01", "fainfe01", "fainfe01", "fainfe01", "tebbebi01", "tebbebi01", "tebbebi01", "tebbebi01",
+#> "tebbebi01", "tebbebi01", "tebbebi01", "tebbebi01", "tebbebi01", "tebbebi01", "tebbebi01", "tebbebi01", "tebbebi01", "tebbebi01", "tebbebi01", "lemonbo01", "lemonbo01", "lemonbo01", "lemonbo01", "lemonbo01", "lemonbo01", "lemonbo01", "lemonbo01", "lemonbo01", "lemonbo01", "lemonbo01", "lemonbo01", "lemonbo01", "lemonbo01", "lemonbo01", "raschvi01", "raschvi01", "raschvi01", "raschvi01", "raschvi01", "raschvi01", "raschvi01", "raschvi01", "raschvi01", "raschvi01", "raschvi01", "masiph01", "masiph01",
+#> "masiph01", "masiph01", "masiph01", "masiph01", "masiph01", "masiph01", "masiph01", "masiph01", "masiph01", "masiph01", "masiph01", "masiph01", "masiph01", "schmijo01", "schmijo01", "schmijo01", "schmijo01", "schmijo01", "schmijo01", "schmijo01", "schmijo01", "schmijo01", "schmijo01", "schmijo01", "schmijo01", "schmijo01", "schmijo01", "schmijo01", "schmijo01", "schmijo01", "schmijo01", "darkal01", "darkal01", "darkal01", "darkal01", "darkal01", "darkal01", "darkal01", "darkal01", "darkal01", "darkal01",
+#> "darkal01", "darkal01", "darkal01", "darkal01", "darkal01", "darkal01", "darkal01", "pagejo01", "pagejo01", "pagejo01", "pagejo01", "pagejo01", "pagejo01", "pagejo01", "pagejo01", "michaca01", "michaca01", "michaca01", "michaca01", "michaca01", "michaca01", "michaca01", "michaca01", "michaca01", "michaca01", "michaca01", "michaca01", "michaca01", "michaca01", "michaca01", "parneme01", "parneme01", "parneme01", "parneme01", "parneme01", "parneme01", "parneme01", "parneme01", "parneme01", "parneme01",
+#> "wertzvi01", "wertzvi01", "wertzvi01", "wertzvi01", "wertzvi01", "wertzvi01", "wertzvi01", "wertzvi01", "wertzvi01", "wertzvi01", "wertzvi01", "wertzvi01", "wertzvi01", "wertzvi01", "wertzvi01", "wertzvi01", "wertzvi01", "wertzvi01", "wertzvi01", "wertzvi01", "wertzvi01", "hodgegi01", "hodgegi01", "hodgegi01", "hodgegi01", "hodgegi01", "hodgegi01", "hodgegi01", "hodgegi01", "hodgegi01", "hodgegi01", "hodgegi01", "hodgegi01", "hodgegi01", "hodgegi01", "hodgegi01", "hodgegi01", "hodgegi01", "hodgegi01",
+#> "gordosi01", "gordosi01", "gordosi01", "gordosi01", "gordosi01", "gordosi01", "gordosi01", "gordosi01", "gordosi01", "gordosi01", "gordosi01", "gordosi01", "gordosi01", "gordosi01", "camparo01", "camparo01", "camparo01", "camparo01", "camparo01", "camparo01", "camparo01", "camparo01", "camparo01", "camparo01", "newcodo01", "newcodo01", "newcodo01", "newcodo01", "newcodo01", "newcodo01", "newcodo01", "newcodo01", "newcodo01", "newcodo01", "newcodo01", "newcodo01", "sievero01", "sievero01", "sievero01",
+#> "sievero01", "sievero01", "sievero01", "sievero01", "sievero01", "sievero01", "sievero01", "sievero01", "sievero01", "sievero01", "sievero01", "sievero01", "sievero01", "sievero01", "sievero01", "kindeel01", "kindeel01", "kindeel01", "kindeel01", "kindeel01", "kindeel01", "kindeel01", "kindeel01", "kindeel01", "kindeel01", "kindeel01", "kindeel01", "kindeel01", "rizzuph01", "rizzuph01", "rizzuph01", "rizzuph01", "rizzuph01", "rizzuph01", "rizzuph01", "rizzuph01", "rizzuph01", "rizzuph01", "rizzuph01",
+#> "rizzuph01", "rizzuph01", "colemje01", "colemje01", "colemje01", "colemje01", "colemje01", "colemje01", "colemje01", "colemje01", "colemje01", "dropowa01", "dropowa01", "dropowa01", "dropowa01", "dropowa01", "dropowa01", "dropowa01", "dropowa01", "dropowa01", "dropowa01", "dropowa01", "dropowa01", "dropowa01", "dropowa01", "dropowa01", "dropowa01", "houttar01", "houttar01", "houttar01", "houttar01", "houttar01", "houttar01", "houttar01", "houttar01", "houttar01", "houttar01", "houttar01", "houttar01",
+#> "houttar01", "houttar01", "konstji01", "konstji01", "konstji01", "konstji01", "konstji01", "konstji01", "konstji01", "konstji01", "konstji01", "konstji01", "konstji01", "konstji01", "konstji01", "furilca01", "furilca01", "furilca01", "furilca01", "furilca01", "furilca01", "furilca01", "furilca01", "furilca01", "furilca01", "furilca01", "furilca01", "furilca01", "furilca01", "furilca01", "snidedu01", "snidedu01", "snidedu01", "snidedu01", "snidedu01", "snidedu01", "snidedu01", "snidedu01", "snidedu01",
+#> "snidedu01", "snidedu01", "snidedu01", "snidedu01", "snidedu01", "snidedu01", "snidedu01", "snidedu01", "snidedu01", "jansela01", "jansela01", "jansela01", "jansela01", "jansela01", "jansela01", "jansela01", "jansela01", "jansela01", "hamnegr01", "hamnegr01", "hamnegr01", "hamnegr01", "hamnegr01", "hamnegr01", "hamnegr01", "hamnegr01", "hamnegr01", "hamnegr01", "hamnegr01", "hamnegr01", "hamnegr01", "hamnegr01", "hamnegr01", "hamnegr01", "hamnegr01", "hamnegr01", "jethrsa01", "jethrsa01", "jethrsa01",
+#> "jethrsa01", "dobyla01", "dobyla01", "dobyla01", "dobyla01", "dobyla01", "dobyla01", "dobyla01", "dobyla01", "dobyla01", "dobyla01", "dobyla01", "dobyla01", "dobyla01", "dobyla01", "mcdougi01", "mcdougi01", "mcdougi01", "mcdougi01", "mcdougi01", "mcdougi01", "mcdougi01", "mcdougi01", "mcdougi01", "mcdougi01", "mayswi01", "mayswi01", "mayswi01", "mayswi01", "mayswi01", "mayswi01", "mayswi01", "mayswi01", "mayswi01", "mayswi01", "mayswi01", "mayswi01", "mayswi01", "mayswi01", "mayswi01", "mayswi01",
+#> "mayswi01", "mayswi01", "mayswi01", "mayswi01", "mayswi01", "mayswi01", "mayswi01", "maglisa01", "maglisa01", "maglisa01", "maglisa01", "maglisa01", "maglisa01", "maglisa01", "maglisa01", "maglisa01", "maglisa01", "maglisa01", "maglisa01", "maglisa01", "maglisa01", "roepr01", "roepr01", "roepr01", "roepr01", "roepr01", "roepr01", "roepr01", "roepr01", "roepr01", "roepr01", "roepr01", "roepr01", "shantbo01", "shantbo01", "shantbo01", "shantbo01", "shantbo01", "shantbo01", "shantbo01", "shantbo01",
+#> "shantbo01", "shantbo01", "shantbo01", "shantbo01", "shantbo01", "shantbo01", "shantbo01", "shantbo01", "shantbo01", "shantbo01", "shantbo01", "sauerha01", "sauerha01", "sauerha01", "sauerha01", "sauerha01", "sauerha01", "sauerha01", "sauerha01", "sauerha01", "sauerha01", "sauerha01", "sauerha01", "sauerha01", "sauerha01", "sauerha01", "sauerha01", "byrdha01", "byrdha01", "byrdha01", "byrdha01", "byrdha01", "byrdha01", "byrdha01", "byrdha01", "blackjo02", "blackjo02", "blackjo02", "blackjo02", "blackjo02",
+#> "blackjo02", "blackjo02", "mantlmi01", "mantlmi01", "mantlmi01", "mantlmi01", "mantlmi01", "mantlmi01", "mantlmi01", "mantlmi01", "mantlmi01", "mantlmi01", "mantlmi01", "mantlmi01", "mantlmi01", "mantlmi01", "mantlmi01", "mantlmi01", "mantlmi01", "mantlmi01", "roberro01", "roberro01", "roberro01", "roberro01", "roberro01", "roberro01", "roberro01", "roberro01", "roberro01", "roberro01", "roberro01", "roberro01", "roberro01", "roberro01", "roberro01", "roberro01", "roberro01", "roberro01", "roberro01",
+#> "roberro01", "roberro01", "eastelu01", "eastelu01", "eastelu01", "eastelu01", "eastelu01", "eastelu01", "martibi02", "martibi02", "martibi02", "martibi02", "martibi02", "martibi02", "martibi02", "martibi02", "martibi02", "martibi02", "martibi02", "martibi02", "martibi02", "rosenal01", "rosenal01", "rosenal01", "rosenal01", "rosenal01", "rosenal01", "rosenal01", "rosenal01", "rosenal01", "rosenal01", "kuennha01", "kuennha01", "kuennha01", "kuennha01", "kuennha01", "kuennha01", "kuennha01", "kuennha01",
+#> "kuennha01", "kuennha01", "kuennha01", "kuennha01", "kuennha01", "kuennha01", "kuennha01", "kuennha01", "kuennha01", "gilliji01", "gilliji01", "gilliji01", "gilliji01", "gilliji01", "gilliji01", "gilliji01", "gilliji01", "gilliji01", "gilliji01", "gilliji01", "gilliji01", "gilliji01", "gilliji01", "schoere01", "schoere01", "schoere01", "schoere01", "schoere01", "schoere01", "schoere01", "schoere01", "schoere01", "schoere01", "schoere01", "schoere01", "schoere01", "schoere01", "schoere01", "schoere01",
+#> "schoere01", "schoere01", "schoere01", "schoere01", "schoere01", "portebo01", "portebo01", "portebo01", "portebo01", "portebo01", "portebo01", "portebo01", "portebo01", "portebo01", "portebo01", "portebo01", "portebo01", "portebo01", "portebo01", "portebo01", "portebo01", "rhodedu01", "rhodedu01", "rhodedu01", "rhodedu01", "rhodedu01", "rhodedu01", "rhodedu01", "grimbo01", "grimbo01", "grimbo01", "grimbo01", "grimbo01", "grimbo01", "grimbo01", "grimbo01", "grimbo01", "grimbo01", "grimbo01", "moonwa01",
+#> "moonwa01", "moonwa01", "moonwa01", "moonwa01", "moonwa01", "moonwa01", "moonwa01", "moonwa01", "moonwa01", "moonwa01", "moonwa01", "kluszte01", "kluszte01", "kluszte01", "kluszte01", "kluszte01", "kluszte01", "kluszte01", "kluszte01", "kluszte01", "kluszte01", "kluszte01", "kluszte01", "kluszte01", "kluszte01", "kluszte01", "kluszte01", "avilabo01", "avilabo01", "avilabo01", "avilabo01", "avilabo01", "avilabo01", "avilabo01", "avilabo01", "avilabo01", "avilabo01", "avilabo01", "avilabo01", "avilabo01",
+#> "antonjo02", "antonjo02", "antonjo02", "antonjo02", "antonjo02", "antonjo02", "antonjo02", "antonjo02", "antonjo02", "antonjo02", "antonjo02", "antonjo02", "antonjo02", "ayalabo01", "ayalabo01", "ayalabo01", "ayalabo01", "ayalabo01", "ayalabo01", "ayalabo01", "ayalabo01", "ayalabo01", "podrejo01", "podrejo01", "podrejo01", "podrejo01", "podrejo01", "podrejo01", "podrejo01", "podrejo01", "podrejo01", "podrejo01", "podrejo01", "podrejo01", "podrejo01", "podrejo01", "podrejo01", "podrejo01", "scorehe01",
+#> "scorehe01", "scorehe01", "scorehe01", "scorehe01", "scorehe01", "scorehe01", "scorehe01", "virdobi01", "virdobi01", "virdobi01", "virdobi01", "virdobi01", "virdobi01", "virdobi01", "virdobi01", "virdobi01", "virdobi01", "virdobi01", "virdobi01", "virdobi01", "foxne01", "foxne01", "foxne01", "foxne01", "foxne01", "foxne01", "foxne01", "foxne01", "foxne01", "foxne01", "foxne01", "foxne01", "foxne01", "foxne01", "foxne01", "foxne01", "foxne01", "foxne01", "foxne01", "matheed01", "matheed01", "matheed01",
+#> "matheed01", "matheed01", "matheed01", "matheed01", "matheed01", "matheed01", "matheed01", "matheed01", "matheed01", "matheed01", "matheed01", "matheed01", "matheed01", "matheed01", "matheed01", "kalinal01", "kalinal01", "kalinal01", "kalinal01", "kalinal01", "kalinal01", "kalinal01", "kalinal01", "kalinal01", "kalinal01", "kalinal01", "kalinal01", "kalinal01", "kalinal01", "kalinal01", "kalinal01", "kalinal01", "kalinal01", "kalinal01", "kalinal01", "kalinal01", "kalinal01", "fordwh01", "fordwh01",
+#> "fordwh01", "fordwh01", "fordwh01", "fordwh01", "fordwh01", "fordwh01", "fordwh01", "fordwh01", "fordwh01", "fordwh01", "fordwh01", "fordwh01", "fordwh01", "fordwh01", "bankser01", "bankser01", "bankser01", "bankser01", "bankser01", "bankser01", "bankser01", "bankser01", "bankser01", "bankser01", "bankser01", "bankser01", "bankser01", "bankser01", "bankser01", "bankser01", "bankser01", "bankser01", "bankser01", "larsedo01", "larsedo01", "larsedo01", "larsedo01", "larsedo01", "larsedo01", "larsedo01",
+#> "larsedo01", "larsedo01", "larsedo01", "larsedo01", "larsedo01", "larsedo01", "larsedo01", "larsedo01", "larsedo01", "larsedo01", "aparilu01", "aparilu01", "aparilu01", "aparilu01", "aparilu01", "aparilu01", "aparilu01", "aparilu01", "aparilu01", "aparilu01", "aparilu01", "aparilu01", "aparilu01", "aparilu01", "aparilu01", "aparilu01", "aparilu01", "aparilu01", "robinfr02", "robinfr02", "robinfr02", "robinfr02", "robinfr02", "robinfr02", "robinfr02", "robinfr02", "robinfr02", "robinfr02", "robinfr02",
+#> "robinfr02", "robinfr02", "robinfr02", "robinfr02", "robinfr02", "robinfr02", "robinfr02", "robinfr02", "robinfr02", "robinfr02", "robinfr02", "boyerke01", "boyerke01", "boyerke01", "boyerke01", "boyerke01", "boyerke01", "boyerke01", "boyerke01", "boyerke01", "boyerke01", "boyerke01", "boyerke01", "boyerke01", "boyerke01", "boyerke01", "boyerke01", "boyerke01", "aaronha01", "aaronha01", "aaronha01", "aaronha01", "aaronha01", "aaronha01", "aaronha01", "aaronha01", "aaronha01", "aaronha01", "aaronha01",
+#> "aaronha01", "aaronha01", "aaronha01", "aaronha01", "aaronha01", "aaronha01", "aaronha01", "aaronha01", "aaronha01", "aaronha01", "aaronha01", "aaronha01", "piercbi02", "piercbi02", "piercbi02", "piercbi02", "piercbi02", "piercbi02", "piercbi02", "piercbi02", "piercbi02", "piercbi02", "piercbi02", "piercbi02", "piercbi02", "piercbi02", "piercbi02", "piercbi02", "piercbi02", "piercbi02", "burdele01", "burdele01", "burdele01", "burdele01", "burdele01", "burdele01", "burdele01", "burdele01", "burdele01",
+#> "burdele01", "burdele01", "burdele01", "burdele01", "burdele01", "burdele01", "burdele01", "burdele01", "burdele01", "burdele01", "burdele01", "burdele01", "malzofr01", "malzofr01", "malzofr01", "malzofr01", "malzofr01", "malzofr01", "malzofr01", "malzofr01", "malzofr01", "malzofr01", "malzofr01", "malzofr01", "lollash01", "lollash01", "lollash01", "lollash01", "lollash01", "lollash01", "lollash01", "lollash01", "lollash01", "lollash01", "lollash01", "lollash01", "lollash01", "lollash01", "lollash01",
+#> "lollash01", "lollash01", "lollash01", "minosmi01", "minosmi01", "minosmi01", "minosmi01", "minosmi01", "minosmi01", "minosmi01", "minosmi01", "minosmi01", "minosmi01", "minosmi01", "minosmi01", "minosmi01", "minosmi01", "minosmi01", "minosmi01", "minosmi01", "minosmi01", "mcmilro01", "mcmilro01", "mcmilro01", "mcmilro01", "mcmilro01", "mcmilro01", "mcmilro01", "mcmilro01", "mcmilro01", "mcmilro01", "mcmilro01", "mcmilro01", "mcmilro01", "mcmilro01", "mcmilro01", "mcmilro01", "mcmilro01", "kubekto01",
+#> "kubekto01", "kubekto01", "kubekto01", "kubekto01", "kubekto01", "kubekto01", "kubekto01", "kubekto01", "sanfoja02", "sanfoja02", "sanfoja02", "sanfoja02", "sanfoja02", "sanfoja02", "sanfoja02", "sanfoja02", "sanfoja02", "sanfoja02", "sanfoja02", "sanfoja02", "sanfoja02", "sanfoja02", "bunniji01", "bunniji01", "bunniji01", "bunniji01", "bunniji01", "bunniji01", "bunniji01", "bunniji01", "bunniji01", "bunniji01", "bunniji01", "bunniji01", "bunniji01", "bunniji01", "bunniji01", "bunniji01", "bunniji01",
+#> "bunniji01", "howarel01", "howarel01", "howarel01", "howarel01", "howarel01", "howarel01", "howarel01", "howarel01", "howarel01", "howarel01", "howarel01", "howarel01", "howarel01", "howarel01", "howarel01", "turlebo01", "turlebo01", "turlebo01", "turlebo01", "turlebo01", "turlebo01", "turlebo01", "turlebo01", "turlebo01", "turlebo01", "turlebo01", "turlebo01", "turlebo01", "powervi01", "powervi01", "powervi01", "powervi01", "powervi01", "powervi01", "powervi01", "powervi01", "powervi01", "powervi01",
+#> "powervi01", "powervi01", "powervi01", "powervi01", "powervi01", "bollifr01", "bollifr01", "bollifr01", "bollifr01", "bollifr01", "bollifr01", "bollifr01", "bollifr01", "bollifr01", "bollifr01", "bollifr01", "bollifr01", "piersji01", "piersji01", "piersji01", "piersji01", "piersji01", "piersji01", "piersji01", "piersji01", "piersji01", "piersji01", "piersji01", "piersji01", "piersji01", "piersji01", "piersji01", "piersji01", "piersji01", "piersji01", "piersji01", "siebeno01", "siebeno01", "siebeno01",
+#> "siebeno01", "siebeno01", "siebeno01", "siebeno01", "siebeno01", "siebeno01", "siebeno01", "siebeno01", "siebeno01", "siebeno01", "mazerbi01", "mazerbi01", "mazerbi01", "mazerbi01", "mazerbi01", "mazerbi01", "mazerbi01", "mazerbi01", "mazerbi01", "mazerbi01", "mazerbi01", "mazerbi01", "mazerbi01", "mazerbi01", "mazerbi01", "mazerbi01", "mazerbi01", "crandde01", "crandde01", "crandde01", "crandde01", "crandde01", "crandde01", "crandde01", "crandde01", "crandde01", "crandde01", "crandde01", "crandde01",
+#> "crandde01", "crandde01", "crandde01", "crandde01", "haddiha01", "haddiha01", "haddiha01", "haddiha01", "haddiha01", "haddiha01", "haddiha01", "haddiha01", "haddiha01", "haddiha01", "haddiha01", "haddiha01", "haddiha01", "haddiha01", "haddiha01", "jenseja01", "jenseja01", "jenseja01", "jenseja01", "jenseja01", "jenseja01", "jenseja01", "jenseja01", "jenseja01", "jenseja01", "jenseja01", "jenseja01", "pearsal02", "pearsal02", "pearsal02", "pearsal02", "pearsal02", "pearsal02", "pearsal02", "pearsal02",
+#> "pearsal02", "pearsal02", "cepedor01", "cepedor01", "cepedor01", "cepedor01", "cepedor01", "cepedor01", "cepedor01", "cepedor01", "cepedor01", "cepedor01", "cepedor01", "cepedor01", "cepedor01", "cepedor01", "cepedor01", "cepedor01", "cepedor01", "cepedor01", "cepedor01", "thomafr03", "thomafr03", "thomafr03", "thomafr03", "thomafr03", "thomafr03", "thomafr03", "thomafr03", "thomafr03", "thomafr03", "thomafr03", "thomafr03", "thomafr03", "thomafr03", "thomafr03", "thomafr03", "thomafr03", "thomafr03",
+#> "thomafr03", "thomafr03", "frienbo01", "frienbo01", "frienbo01", "frienbo01", "frienbo01", "frienbo01", "frienbo01", "frienbo01", "frienbo01", "frienbo01", "frienbo01", "frienbo01", "frienbo01", "frienbo01", "frienbo01", "frienbo01", "frienbo01", "sherrla01", "sherrla01", "sherrla01", "sherrla01", "sherrla01", "sherrla01", "sherrla01", "sherrla01", "sherrla01", "sherrla01", "sherrla01", "sherrla01", "wynnea01", "wynnea01", "wynnea01", "wynnea01", "wynnea01", "wynnea01", "wynnea01", "wynnea01", "wynnea01",
+#> "wynnea01", "wynnea01", "wynnea01", "wynnea01", "wynnea01", "wynnea01", "wynnea01", "wynnea01", "wynnea01", "wynnea01", "wynnea01", "wynnea01", "wynnea01", "wynnea01", "nealch01", "nealch01", "nealch01", "nealch01", "nealch01", "nealch01", "nealch01", "nealch01", "nealch01", "brandja01", "brandja01", "brandja01", "brandja01", "brandja01", "brandja01", "brandja01", "brandja01", "brandja01", "brandja01", "brandja01", "brandja01", "brandja01", "allisbo01", "allisbo01", "allisbo01", "allisbo01", "allisbo01",
+#> "allisbo01", "allisbo01", "allisbo01", "allisbo01", "allisbo01", "allisbo01", "allisbo01", "allisbo01", "mccovwi01", "mccovwi01", "mccovwi01", "mccovwi01", "mccovwi01", "mccovwi01", "mccovwi01", "mccovwi01", "mccovwi01", "mccovwi01", "mccovwi01", "mccovwi01", "mccovwi01", "mccovwi01", "mccovwi01", "mccovwi01", "mccovwi01", "mccovwi01", "mccovwi01", "mccovwi01", "mccovwi01", "mccovwi01", "mccovwi01", "jonessa02", "jonessa02", "jonessa02", "jonessa02", "jonessa02", "jonessa02", "jonessa02", "jonessa02",
+#> "jonessa02", "jonessa02", "jonessa02", "jonessa02", "lawve01", "lawve01", "lawve01", "lawve01", "lawve01", "lawve01", "lawve01", "lawve01", "lawve01", "lawve01", "lawve01", "lawve01", "lawve01", "lawve01", "lawve01", "lawve01", "robinbr01", "robinbr01", "robinbr01", "robinbr01", "robinbr01", "robinbr01", "robinbr01", "robinbr01", "robinbr01", "robinbr01", "robinbr01", "robinbr01", "robinbr01", "robinbr01", "robinbr01", "robinbr01", "robinbr01", "robinbr01", "robinbr01", "robinbr01", "robinbr01",
+#> "robinbr01", "robinbr01", "batteea01", "batteea01", "batteea01", "batteea01", "batteea01", "batteea01", "batteea01", "batteea01", "batteea01", "batteea01", "batteea01", "batteea01", "batteea01", "landiji01", "landiji01", "landiji01", "landiji01", "landiji01", "landiji01", "landiji01", "landiji01", "landiji01", "landiji01", "landiji01", "landiji01", "landiji01", "marisro01", "marisro01", "marisro01", "marisro01", "marisro01", "marisro01", "marisro01", "marisro01", "marisro01", "marisro01", "marisro01",
+#> "marisro01", "marisro01", "whitebi03", "whitebi03", "whitebi03", "whitebi03", "whitebi03", "whitebi03", "whitebi03", "whitebi03", "whitebi03", "whitebi03", "whitebi03", "whitebi03", "whitebi03", "groatdi01", "groatdi01", "groatdi01", "groatdi01", "groatdi01", "groatdi01", "groatdi01", "groatdi01", "groatdi01", "groatdi01", "groatdi01", "groatdi01", "groatdi01", "groatdi01", "groatdi01", "hansero02", "hansero02", "hansero02", "hansero02", "hansero02", "hansero02", "hansero02", "hansero02", "hansero02",
+#> "hansero02", "hansero02", "hansero02", "hansero02", "hansero02", "hansero02", "hansero02", "howarfr01", "howarfr01", "howarfr01", "howarfr01", "howarfr01", "howarfr01", "howarfr01", "howarfr01", "howarfr01", "howarfr01", "howarfr01", "howarfr01", "howarfr01", "howarfr01", "howarfr01", "howarfr01", "howarfr01", "skowrbi01", "skowrbi01", "skowrbi01", "skowrbi01", "skowrbi01", "skowrbi01", "skowrbi01", "skowrbi01", "skowrbi01", "skowrbi01", "skowrbi01", "skowrbi01", "skowrbi01", "skowrbi01", "skowrbi01",
+#> "skowrbi01", "brogler01", "brogler01", "brogler01", "brogler01", "brogler01", "brogler01", "brogler01", "brogler01", "brogler01", "fornimi01", "fornimi01", "fornimi01", "fornimi01", "fornimi01", "fornimi01", "fornimi01", "fornimi01", "fornimi01", "fornimi01", "fornimi01", "fornimi01", "fornimi01", "fornimi01", "fornimi01", "mcdanli01", "mcdanli01", "mcdanli01", "mcdanli01", "mcdanli01", "mcdanli01", "mcdanli01", "mcdanli01", "mcdanli01", "mcdanli01", "mcdanli01", "mcdanli01", "mcdanli01", "mcdanli01",
+#> "mcdanli01", "mcdanli01", "mcdanli01", "mcdanli01", "mcdanli01", "mcdanli01", "mcdanli01", "mcdanli01", "estrach01", "estrach01", "estrach01", "estrach01", "estrach01", "estrach01", "estrach01", "richabo01", "richabo01", "richabo01", "richabo01", "richabo01", "richabo01", "richabo01", "richabo01", "richabo01", "richabo01", "richabo01", "richabo01", "laryfr01", "laryfr01", "laryfr01", "laryfr01", "laryfr01", "laryfr01", "laryfr01", "laryfr01", "laryfr01", "laryfr01", "laryfr01", "laryfr01", "laryfr01",
+#> "laryfr01", "laryfr01", "rosebjo01", "rosebjo01", "rosebjo01", "rosebjo01", "rosebjo01", "rosebjo01", "rosebjo01", "rosebjo01", "rosebjo01", "rosebjo01", "rosebjo01", "rosebjo01", "rosebjo01", "rosebjo01", "clemero01", "clemero01", "clemero01", "clemero01", "clemero01", "clemero01", "clemero01", "clemero01", "clemero01", "clemero01", "clemero01", "clemero01", "clemero01", "clemero01", "clemero01", "clemero01", "clemero01", "clemero01", "pinsova01", "pinsova01", "pinsova01", "pinsova01", "pinsova01",
+#> "pinsova01", "pinsova01", "pinsova01", "pinsova01", "pinsova01", "pinsova01", "pinsova01", "pinsova01", "pinsova01", "pinsova01", "pinsova01", "pinsova01", "pinsova01", "willsma01", "willsma01", "willsma01", "willsma01", "willsma01", "willsma01", "willsma01", "willsma01", "willsma01", "willsma01", "willsma01", "willsma01", "willsma01", "willsma01", "willsma01", "schwado01", "schwado01", "schwado01", "schwado01", "schwado01", "schwado01", "schwado01", "schwado01", "willibi01", "willibi01", "willibi01",
+#> "willibi01", "willibi01", "willibi01", "willibi01", "willibi01", "willibi01", "willibi01", "willibi01", "willibi01", "willibi01", "willibi01", "willibi01", "willibi01", "willibi01", "willibi01", "cashno01", "cashno01", "cashno01", "cashno01", "cashno01", "cashno01", "cashno01", "cashno01", "cashno01", "cashno01", "cashno01", "cashno01", "cashno01", "cashno01", "cashno01", "cashno01", "cashno01", "colavro01", "colavro01", "colavro01", "colavro01", "colavro01", "colavro01", "colavro01", "colavro01",
+#> "colavro01", "colavro01", "colavro01", "colavro01", "colavro01", "colavro01", "colavro01", "colavro01", "burgesm01", "burgesm01", "burgesm01", "burgesm01", "burgesm01", "burgesm01", "burgesm01", "burgesm01", "burgesm01", "burgesm01", "burgesm01", "burgesm01", "burgesm01", "burgesm01", "burgesm01", "burgesm01", "burgesm01", "burgesm01", "burgesm01", "burgesm01", "jayjo01", "jayjo01", "jayjo01", "jayjo01", "jayjo01", "jayjo01", "jayjo01", "jayjo01", "jayjo01", "jayjo01", "jayjo01", "jayjo01", "jayjo01",
+#> "jayjo01", "arroylu01", "arroylu01", "arroylu01", "arroylu01", "arroylu01", "arroylu01", "arroylu01", "arroylu01", "millest01", "millest01", "millest01", "millest01", "millest01", "millest01", "millest01", "millest01", "millest01", "millest01", "millest01", "millest01", "millest01", "millest01", "millest01", "millest01", "millest01", "wagnele01", "wagnele01", "wagnele01", "wagnele01", "wagnele01", "wagnele01", "wagnele01", "wagnele01", "wagnele01", "wagnele01", "wagnele01", "wagnele01", "wagnele01",
+#> "terryra01", "terryra01", "terryra01", "terryra01", "terryra01", "terryra01", "terryra01", "terryra01", "terryra01", "terryra01", "terryra01", "terryra01", "terryra01", "terryra01", "terryra01", "drysddo01", "drysddo01", "drysddo01", "drysddo01", "drysddo01", "drysddo01", "drysddo01", "drysddo01", "drysddo01", "drysddo01", "drysddo01", "drysddo01", "drysddo01", "drysddo01", "kaatji01", "kaatji01", "kaatji01", "kaatji01", "kaatji01", "kaatji01", "kaatji01", "kaatji01", "kaatji01", "kaatji01", "kaatji01",
+#> "kaatji01", "kaatji01", "kaatji01", "kaatji01", "kaatji01", "kaatji01", "kaatji01", "kaatji01", "kaatji01", "kaatji01", "kaatji01", "kaatji01", "kaatji01", "kaatji01", "kaatji01", "kaatji01", "kaatji01", "hubbske01", "hubbske01", "hubbske01", "davenji01", "davenji01", "davenji01", "davenji01", "davenji01", "davenji01", "davenji01", "davenji01", "davenji01", "davenji01", "davenji01", "davenji01", "davenji01", "treshto01", "treshto01", "treshto01", "treshto01", "treshto01", "treshto01", "treshto01",
+#> "treshto01", "treshto01", "treshto01", "donovdi01", "donovdi01", "donovdi01", "donovdi01", "donovdi01", "donovdi01", "donovdi01", "donovdi01", "donovdi01", "donovdi01", "donovdi01", "donovdi01", "donovdi01", "donovdi01", "donovdi01", "davisto02", "davisto02", "davisto02", "davisto02", "davisto02", "davisto02", "davisto02", "davisto02", "davisto02", "davisto02", "davisto02", "davisto02", "davisto02", "davisto02", "davisto02", "davisto02", "davisto02", "davisto02", "davisto02", "davisto02", "davisto02",
+#> "davisto02", "davisto02", "purkebo01", "purkebo01", "purkebo01", "purkebo01", "purkebo01", "purkebo01", "purkebo01", "purkebo01", "purkebo01", "purkebo01", "purkebo01", "purkebo01", "purkebo01", "radatdi01", "radatdi01", "radatdi01", "radatdi01", "radatdi01", "radatdi01", "radatdi01", "radatdi01", "radatdi01", "radatdi01", "facero01", "facero01", "facero01", "facero01", "facero01", "facero01", "facero01", "facero01", "facero01", "facero01", "facero01", "facero01", "facero01", "facero01", "facero01",
+#> "facero01", "facero01", "koufasa01", "koufasa01", "koufasa01", "koufasa01", "koufasa01", "koufasa01", "koufasa01", "koufasa01", "koufasa01", "koufasa01", "koufasa01", "koufasa01", "yastrca01", "yastrca01", "yastrca01", "yastrca01", "yastrca01", "yastrca01", "yastrca01", "yastrca01", "yastrca01", "yastrca01", "yastrca01", "yastrca01", "yastrca01", "yastrca01", "yastrca01", "yastrca01", "yastrca01", "yastrca01", "yastrca01", "yastrca01", "yastrca01", "yastrca01", "yastrca01", "versazo01", "versazo01",
+#> "versazo01", "versazo01", "versazo01", "versazo01", "versazo01", "versazo01", "versazo01", "versazo01", "versazo01", "versazo01", "versazo01", "edwarjo01", "edwarjo01", "edwarjo01", "edwarjo01", "edwarjo01", "edwarjo01", "edwarjo01", "edwarjo01", "edwarjo01", "edwarjo01", "edwarjo01", "edwarjo01", "edwarjo01", "edwarjo01", "floodcu01", "floodcu01", "floodcu01", "floodcu01", "floodcu01", "floodcu01", "floodcu01", "floodcu01", "floodcu01", "floodcu01", "floodcu01", "floodcu01", "floodcu01", "floodcu01",
+#> "floodcu01", "winebo01", "winebo01", "winebo01", "winebo01", "winebo01", "winebo01", "winebo01", "winebo01", "winebo01", "winebo01", "winebo01", "winebo01", "peterga01", "peterga01", "peterga01", "peterga01", "peterga01", "peterga01", "peterga01", "peterga01", "peterga01", "peterga01", "peterga01", "peterga01", "peterga01", "peterga01", "rosepe01", "rosepe01", "rosepe01", "rosepe01", "rosepe01", "rosepe01", "rosepe01", "rosepe01", "rosepe01", "rosepe01", "rosepe01", "rosepe01", "rosepe01", "rosepe01",
+#> "rosepe01", "rosepe01", "rosepe01", "rosepe01", "rosepe01", "rosepe01", "rosepe01", "rosepe01", "rosepe01", "rosepe01", "rosepe01", "pepitjo01", "pepitjo01", "pepitjo01", "pepitjo01", "pepitjo01", "pepitjo01", "pepitjo01", "pepitjo01", "pepitjo01", "pepitjo01", "pepitjo01", "pepitjo01", "pepitjo01", "pepitjo01", "maricju01", "maricju01", "maricju01", "maricju01", "maricju01", "maricju01", "maricju01", "maricju01", "maricju01", "maricju01", "maricju01", "maricju01", "maricju01", "maricju01", "maricju01",
+#> "maricju01", "callijo01", "callijo01", "callijo01", "callijo01", "callijo01", "callijo01", "callijo01", "callijo01", "callijo01", "callijo01", "callijo01", "callijo01", "callijo01", "callijo01", "callijo01", "callijo01", "gibsobo01", "gibsobo01", "gibsobo01", "gibsobo01", "gibsobo01", "gibsobo01", "gibsobo01", "gibsobo01", "gibsobo01", "gibsobo01", "gibsobo01", "gibsobo01", "gibsobo01", "gibsobo01", "gibsobo01", "gibsobo01", "gibsobo01", "chancde01", "chancde01", "chancde01", "chancde01", "chancde01",
+#> "chancde01", "chancde01", "chancde01", "chancde01", "chancde01", "chancde01", "chancde01", "davalvi01", "davalvi01", "davalvi01", "davalvi01", "davalvi01", "davalvi01", "davalvi01", "davalvi01", "davalvi01", "davalvi01", "davalvi01", "davalvi01", "davalvi01", "davalvi01", "davalvi01", "davalvi01", "davalvi01", "davalvi01", "davalvi01", "santoro01", "santoro01", "santoro01", "santoro01", "santoro01", "santoro01", "santoro01", "santoro01", "santoro01", "santoro01", "santoro01", "santoro01", "santoro01",
+#> "santoro01", "santoro01", "amaroru01", "amaroru01", "amaroru01", "amaroru01", "amaroru01", "amaroru01", "amaroru01", "amaroru01", "amaroru01", "amaroru01", "amaroru01", "olivato01", "olivato01", "olivato01", "olivato01", "olivato01", "olivato01", "olivato01", "olivato01", "olivato01", "olivato01", "olivato01", "olivato01", "olivato01", "olivato01", "olivato01", "allendi01", "allendi01", "allendi01", "allendi01", "allendi01", "allendi01", "allendi01", "allendi01", "allendi01", "allendi01", "allendi01",
+#> "allendi01", "allendi01", "allendi01", "allendi01", "stuardi01", "stuardi01", "stuardi01", "stuardi01", "stuardi01", "stuardi01", "stuardi01", "stuardi01", "stuardi01", "stuardi01", "stuardi01", "killeha01", "killeha01", "killeha01", "killeha01", "killeha01", "killeha01", "killeha01", "killeha01", "killeha01", "killeha01", "killeha01", "killeha01", "killeha01", "killeha01", "killeha01", "killeha01", "killeha01", "killeha01", "killeha01", "killeha01", "killeha01", "killeha01", "fregoji01", "fregoji01",
+#> "fregoji01", "fregoji01", "fregoji01", "fregoji01", "fregoji01", "fregoji01", "fregoji01", "fregoji01", "fregoji01", "fregoji01", "fregoji01", "fregoji01", "fregoji01", "fregoji01", "fregoji01", "fregoji01", "fregoji01", "fregoji01", "huntro01", "huntro01", "huntro01", "huntro01", "huntro01", "huntro01", "huntro01", "huntro01", "huntro01", "huntro01", "huntro01", "huntro01", "huntro01", "torrejo01", "torrejo01", "torrejo01", "torrejo01", "torrejo01", "torrejo01", "torrejo01", "torrejo01", "torrejo01",
+#> "torrejo01", "torrejo01", "torrejo01", "torrejo01", "torrejo01", "torrejo01", "torrejo01", "torrejo01", "torrejo01", "mcbeaal01", "mcbeaal01", "mcbeaal01", "mcbeaal01", "mcbeaal01", "mcbeaal01", "mcbeaal01", "mcbeaal01", "mcbeaal01", "mcbeaal01", "mcbeaal01", "mcbeaal01", "freehbi01", "freehbi01", "freehbi01", "freehbi01", "freehbi01", "freehbi01", "freehbi01", "freehbi01", "freehbi01", "freehbi01", "freehbi01", "freehbi01", "freehbi01", "freehbi01", "freehbi01", "cardele01", "cardele01", "cardele01",
+#> "cardele01", "cardele01", "cardele01", "cardele01", "cardele01", "cardele01", "cardele01", "cardele01", "cardele01", "cardele01", "cardele01", "cardele01", "cardele01", "blefacu01", "blefacu01", "blefacu01", "blefacu01", "blefacu01", "blefacu01", "blefacu01", "blefacu01", "blefacu01", "blefacu01", "lefebji01", "lefebji01", "lefebji01", "lefebji01", "lefebji01", "lefebji01", "lefebji01", "lefebji01", "whitffr01", "whitffr01", "whitffr01", "whitffr01", "whitffr01", "whitffr01", "whitffr01", "whitffr01",
+#> "whitffr01", "hallji02", "hallji02", "hallji02", "hallji02", "hallji02", "hallji02", "hallji02", "hallji02", "hallji02", "hallji02", "hallji02", "hallji02", "grantmu01", "grantmu01", "grantmu01", "grantmu01", "grantmu01", "grantmu01", "grantmu01", "grantmu01", "grantmu01", "grantmu01", "grantmu01", "grantmu01", "grantmu01", "grantmu01", "grantmu01", "grantmu01", "grantmu01", "grantmu01", "stottme01", "stottme01", "stottme01", "stottme01", "stottme01", "stottme01", "stottme01", "stottme01", "stottme01",
+#> "stottme01", "stottme01", "johnsde01", "johnsde01", "johnsde01", "johnsde01", "johnsde01", "johnsde01", "johnsde01", "johnsde01", "johnsde01", "johnsde01", "johnsde01", "johnsde01", "johnsde01", "johnsde01", "johnsde01", "johnsde01", "johnsde01", "johnsde01", "johnsde01", "johnsde01", "johnsde01", "stargwi01", "stargwi01", "stargwi01", "stargwi01", "stargwi01", "stargwi01", "stargwi01", "stargwi01", "stargwi01", "stargwi01", "stargwi01", "stargwi01", "stargwi01", "stargwi01", "stargwi01", "stargwi01",
+#> "stargwi01", "stargwi01", "stargwi01", "stargwi01", "stargwi01", "fisheed02", "fisheed02", "fisheed02", "fisheed02", "fisheed02", "fisheed02", "fisheed02", "fisheed02", "fisheed02", "fisheed02", "fisheed02", "fisheed02", "fisheed02", "fisheed02", "fisheed02", "fisheed02", "fisheed02", "fisheed02", "abernte02", "abernte02", "abernte02", "abernte02", "abernte02", "abernte02", "abernte02", "abernte02", "abernte02", "abernte02", "abernte02", "abernte02", "abernte02", "abernte02", "abernte02", "abernte02",
+#> "abernte02", "knoopbo01", "knoopbo01", "knoopbo01", "knoopbo01", "knoopbo01", "knoopbo01", "knoopbo01", "knoopbo01", "knoopbo01", "knoopbo01", "ageeto01", "ageeto01", "ageeto01", "ageeto01", "ageeto01", "ageeto01", "ageeto01", "ageeto01", "ageeto01", "ageeto01", "ageeto01", "ageeto01", "ageeto01", "alleyge01", "alleyge01", "alleyge01", "alleyge01", "alleyge01", "alleyge01", "alleyge01", "alleyge01", "alleyge01", "alleyge01", "alleyge01", "helmsto01", "helmsto01", "helmsto01", "helmsto01", "helmsto01",
+#> "helmsto01", "helmsto01", "helmsto01", "helmsto01", "helmsto01", "helmsto01", "helmsto01", "helmsto01", "helmsto01", "helmsto01", "powelbo01", "powelbo01", "powelbo01", "powelbo01", "powelbo01", "powelbo01", "powelbo01", "powelbo01", "powelbo01", "powelbo01", "powelbo01", "powelbo01", "powelbo01", "powelbo01", "powelbo01", "powelbo01", "powelbo01", "casanpa01", "casanpa01", "casanpa01", "casanpa01", "casanpa01", "casanpa01", "casanpa01", "casanpa01", "casanpa01", "casanpa01", "wilsoea01", "wilsoea01",
+#> "wilsoea01", "wilsoea01", "wilsoea01", "wilsoea01", "wilsoea01", "wilsoea01", "wilsoea01", "wilsoea01", "wilsoea01", "wilsoea01", "wilsoea01", "aloufe01", "aloufe01", "aloufe01", "aloufe01", "aloufe01", "aloufe01", "aloufe01", "aloufe01", "aloufe01", "aloufe01", "aloufe01", "aloufe01", "aloufe01", "aloufe01", "aloufe01", "aloufe01", "aloufe01", "aloufe01", "aloufe01", "akerja01", "akerja01", "akerja01", "akerja01", "akerja01", "akerja01", "akerja01", "akerja01", "akerja01", "akerja01", "akerja01",
+#> "akerja01", "akerja01", "akerja01", "reganph01", "reganph01", "reganph01", "reganph01", "reganph01", "reganph01", "reganph01", "reganph01", "reganph01", "reganph01", "reganph01", "reganph01", "reganph01", "reganph01", "reganph01", "perezto01", "perezto01", "perezto01", "perezto01", "perezto01", "perezto01", "perezto01", "perezto01", "perezto01", "perezto01", "perezto01", "perezto01", "perezto01", "perezto01", "perezto01", "perezto01", "perezto01", "perezto01", "perezto01", "perezto01", "perezto01",
+#> "perezto01", "perezto01", "brocklo01", "brocklo01", "brocklo01", "brocklo01", "brocklo01", "brocklo01", "brocklo01", "brocklo01", "brocklo01", "brocklo01", "brocklo01", "brocklo01", "brocklo01", "brocklo01", "brocklo01", "brocklo01", "brocklo01", "brocklo01", "brocklo01", "brocklo01", "lonboji01", "lonboji01", "lonboji01", "lonboji01", "lonboji01", "lonboji01", "lonboji01", "lonboji01", "lonboji01", "lonboji01", "lonboji01", "lonboji01", "lonboji01", "lonboji01", "lonboji01", "mccormi03", "mccormi03",
+#> "mccormi03", "mccormi03", "mccormi03", "mccormi03", "mccormi03", "mccormi03", "mccormi03", "mccormi03", "mccormi03", "mccormi03", "mccormi03", "mccormi03", "mccormi03", "mccormi03", "mccormi03", "scottge02", "scottge02", "scottge02", "scottge02", "scottge02", "scottge02", "scottge02", "scottge02", "scottge02", "scottge02", "scottge02", "scottge02", "scottge02", "scottge02", "scottge02", "scottge02", "blairpa01", "blairpa01", "blairpa01", "blairpa01", "blairpa01", "blairpa01", "blairpa01", "blairpa01",
+#> "blairpa01", "blairpa01", "blairpa01", "blairpa01", "blairpa01", "blairpa01", "blairpa01", "blairpa01", "blairpa01", "blairpa01", "parkewe01", "parkewe01", "parkewe01", "parkewe01", "parkewe01", "parkewe01", "parkewe01", "parkewe01", "parkewe01", "hundlra01", "hundlra01", "hundlra01", "hundlra01", "hundlra01", "hundlra01", "hundlra01", "hundlra01", "hundlra01", "hundlra01", "hundlra01", "hundlra01", "hundlra01", "hundlra01", "carewro01", "carewro01", "carewro01", "carewro01", "carewro01", "carewro01",
+#> "carewro01", "carewro01", "carewro01", "carewro01", "carewro01", "carewro01", "carewro01", "carewro01", "carewro01", "carewro01", "carewro01", "carewro01", "carewro01", "seaveto01", "seaveto01", "seaveto01", "seaveto01", "seaveto01", "seaveto01", "seaveto01", "seaveto01", "seaveto01", "seaveto01", "seaveto01", "seaveto01", "seaveto01", "seaveto01", "seaveto01", "seaveto01", "seaveto01", "seaveto01", "seaveto01", "seaveto01", "seaveto01", "seaveto01", "mccarti01", "mccarti01", "mccarti01", "mccarti01",
+#> "mccarti01", "mccarti01", "mccarti01", "mccarti01", "mccarti01", "mccarti01", "mccarti01", "mccarti01", "mccarti01", "mccarti01", "mccarti01", "mccarti01", "mccarti01", "mccarti01", "mccarti01", "mccarti01", "mccarti01", "mccarti01", "mccarti01", "mccarti01", "wynnji01", "wynnji01", "wynnji01", "wynnji01", "wynnji01", "wynnji01", "wynnji01", "wynnji01", "wynnji01", "wynnji01", "wynnji01", "wynnji01", "wynnji01", "wynnji01", "wynnji01", "wynnji01", "jenkife01", "jenkife01", "jenkife01", "jenkife01",
+#> "jenkife01", "jenkife01", "jenkife01", "jenkife01", "jenkife01", "jenkife01", "jenkife01", "jenkife01", "jenkife01", "jenkife01", "jenkife01", "jenkife01", "jenkife01", "jenkife01", "jenkife01", "jenkife01", "rojasmi01", "rojasmi01", "rojasmi01", "lolicmi01", "lolicmi01", "lolicmi01", "lolicmi01", "lolicmi01", "lolicmi01", "lolicmi01", "lolicmi01", "lolicmi01", "lolicmi01", "lolicmi01", "lolicmi01", "lolicmi01", "lolicmi01", "lolicmi01", "lolicmi01", "mclaide01", "mclaide01", "mclaide01", "mclaide01",
+#> "mclaide01", "mclaide01", "mclaide01", "mclaide01", "mclaide01", "mclaide01", "mclaide01", "smithre06", "smithre06", "smithre06", "smithre06", "smithre06", "smithre06", "smithre06", "smithre06", "smithre06", "smithre06", "smithre06", "smithre06", "smithre06", "smithre06", "smithre06", "smithre06", "smithre06", "smithre06", "stanlmi01", "stanlmi01", "stanlmi01", "stanlmi01", "stanlmi01", "stanlmi01", "stanlmi01", "stanlmi01", "stanlmi01", "stanlmi01", "stanlmi01", "stanlmi01", "stanlmi01", "stanlmi01",
+#> "stanlmi01", "beckegl01", "beckegl01", "beckegl01", "beckegl01", "beckegl01", "beckegl01", "beckegl01", "beckegl01", "beckegl01", "beckegl01", "beckegl01", "benchjo01", "benchjo01", "benchjo01", "benchjo01", "benchjo01", "benchjo01", "benchjo01", "benchjo01", "benchjo01", "benchjo01", "benchjo01", "benchjo01", "benchjo01", "benchjo01", "benchjo01", "benchjo01", "benchjo01", "maxvida01", "maxvida01", "maxvida01", "maxvida01", "maxvida01", "maxvida01", "maxvida01", "maxvida01", "maxvida01", "maxvida01",
+#> "maxvida01", "maxvida01", "maxvida01", "maxvida01", "maxvida01", "maxvida01", "maxvida01", "bahnsst01", "bahnsst01", "bahnsst01", "bahnsst01", "bahnsst01", "bahnsst01", "bahnsst01", "bahnsst01", "bahnsst01", "bahnsst01", "bahnsst01", "bahnsst01", "bahnsst01", "bahnsst01", "bahnsst01", "bahnsst01", "bahnsst01", "bahnsst01", "bahnsst01", "harreke01", "harreke01", "harreke01", "harreke01", "harreke01", "harreke01", "harreke01", "harreke01", "harreke01", "harreke01", "harreke01", "harreke01", "harreke01",
+#> "hortowi01", "hortowi01", "hortowi01", "hortowi01", "hortowi01", "hortowi01", "hortowi01", "hortowi01", "hortowi01", "hortowi01", "hortowi01", "hortowi01", "hortowi01", "hortowi01", "hortowi01", "hortowi01", "hortowi01", "hortowi01", "hortowi01", "hortowi01", "hortowi01", "mcnalda01", "mcnalda01", "mcnalda01", "mcnalda01", "mcnalda01", "mcnalda01", "mcnalda01", "mcnalda01", "mcnalda01", "mcnalda01", "mcnalda01", "mcnalda01", "mcnalda01", "mcnalda01", "kessido01", "kessido01", "kessido01", "kessido01",
+#> "kessido01", "kessido01", "kessido01", "kessido01", "kessido01", "kessido01", "kessido01", "kessido01", "kessido01", "kessido01", "kessido01", "kessido01", "kessido01", "woodwi01", "woodwi01", "woodwi01", "woodwi01", "woodwi01", "woodwi01", "woodwi01", "woodwi01", "woodwi01", "woodwi01", "woodwi01", "woodwi01", "woodwi01", "woodwi01", "woodwi01", "woodwi01", "woodwi01", "woodwi01", "weisal01", "weisal01", "weisal01", "weisal01", "weisal01", "weisal01", "weisal01", "weisal01", "weisal01", "weisal01",
+#> "cuellmi01", "cuellmi01", "cuellmi01", "cuellmi01", "cuellmi01", "cuellmi01", "cuellmi01", "cuellmi01", "cuellmi01", "cuellmi01", "cuellmi01", "cuellmi01", "cuellmi01", "cuellmi01", "cuellmi01", "johnsda02", "johnsda02", "johnsda02", "johnsda02", "johnsda02", "johnsda02", "johnsda02", "johnsda02", "johnsda02", "johnsda02", "johnsda02", "johnsda02", "johnsda02", "johnsda02", "belanma01", "belanma01", "belanma01", "belanma01", "belanma01", "belanma01", "belanma01", "belanma01", "belanma01", "belanma01",
+#> "belanma01", "belanma01", "belanma01", "belanma01", "belanma01", "belanma01", "belanma01", "belanma01", "millafe01", "millafe01", "millafe01", "millafe01", "millafe01", "millafe01", "millafe01", "millafe01", "millafe01", "millafe01", "millafe01", "millafe01", "boyercl02", "boyercl02", "boyercl02", "boyercl02", "boyercl02", "boyercl02", "boyercl02", "boyercl02", "boyercl02", "boyercl02", "boyercl02", "boyercl02", "boyercl02", "boyercl02", "boyercl02", "boyercl02", "pinielo01", "pinielo01", "pinielo01",
+#> "pinielo01", "pinielo01", "pinielo01", "pinielo01", "pinielo01", "pinielo01", "pinielo01", "pinielo01", "pinielo01", "pinielo01", "pinielo01", "pinielo01", "pinielo01", "pinielo01", "pinielo01", "sizemte01", "sizemte01", "sizemte01", "sizemte01", "sizemte01", "sizemte01", "sizemte01", "sizemte01", "sizemte01", "sizemte01", "sizemte01", "sizemte01", "sizemte01", "jacksre01", "jacksre01", "jacksre01", "jacksre01", "jacksre01", "jacksre01", "jacksre01", "jacksre01", "jacksre01", "jacksre01", "jacksre01",
+#> "jacksre01", "jacksre01", "jacksre01", "jacksre01", "jacksre01", "jacksre01", "jacksre01", "jacksre01", "jacksre01", "jacksre01", "petrori01", "petrori01", "petrori01", "petrori01", "petrori01", "petrori01", "petrori01", "petrori01", "petrori01", "petrori01", "petrori01", "petrori01", "petrori01", "carltst01", "carltst01", "carltst01", "carltst01", "carltst01", "carltst01", "carltst01", "carltst01", "carltst01", "carltst01", "carltst01", "carltst01", "carltst01", "carltst01", "carltst01", "carltst01",
+#> "carltst01", "carltst01", "carltst01", "carltst01", "carltst01", "carltst01", "carltst01", "carltst01", "carltst01", "carltst01", "carltst01", "alouma01", "alouma01", "alouma01", "alouma01", "alouma01", "alouma01", "alouma01", "alouma01", "alouma01", "alouma01", "alouma01", "alouma01", "alouma01", "alouma01", "alouma01", "alouma01", "alouma01", "jonescl01", "jonescl01", "jonescl01", "jonescl01", "jonescl01", "jonescl01", "jonescl01", "jonescl01", "jonescl01", "jonescl01", "jonescl01", "jonescl01",
+#> "jonescl01", "perraro01", "perraro01", "perraro01", "perraro01", "perraro01", "perraro01", "perraro01", "perraro01", "perraro01", "perraro01", "perraro01", "perraro01", "perraro01", "perraro01", "perraro01", "grangwa01", "grangwa01", "grangwa01", "grangwa01", "grangwa01", "grangwa01", "grangwa01", "grangwa01", "grangwa01", "grangwa01", "clenddo01", "clenddo01", "clenddo01", "clenddo01", "clenddo01", "clenddo01", "clenddo01", "clenddo01", "clenddo01", "clenddo01", "clenddo01", "clenddo01", "clenddo01",
+#> "perryji01", "perryji01", "perryji01", "perryji01", "perryji01", "perryji01", "perryji01", "perryji01", "perryji01", "perryji01", "perryji01", "perryji01", "perryji01", "perryji01", "perryji01", "perryji01", "perryji01", "perryji01", "perryji01", "spencji01", "spencji01", "spencji01", "spencji01", "spencji01", "spencji01", "spencji01", "spencji01", "spencji01", "spencji01", "spencji01", "spencji01", "spencji01", "spencji01", "spencji01", "spencji01", "spencji01", "fossera01", "fossera01", "fossera01",
+#> "fossera01", "fossera01", "fossera01", "fossera01", "fossera01", "fossera01", "fossera01", "fossera01", "fossera01", "fossera01", "berryke01", "berryke01", "berryke01", "berryke01", "berryke01", "berryke01", "berryke01", "berryke01", "berryke01", "berryke01", "berryke01", "berryke01", "berryke01", "berryke01", "raderdo02", "raderdo02", "raderdo02", "raderdo02", "raderdo02", "raderdo02", "raderdo02", "raderdo02", "raderdo02", "raderdo02", "raderdo02", "raderdo02", "conigto01", "conigto01", "conigto01",
+#> "conigto01", "conigto01", "conigto01", "conigto01", "conigto01", "munsoth01", "munsoth01", "munsoth01", "munsoth01", "munsoth01", "munsoth01", "munsoth01", "munsoth01", "munsoth01", "munsoth01", "munsoth01", "mortoca01", "mortoca01", "mortoca01", "mortoca01", "mortoca01", "mortoca01", "mortoca01", "mortoca01", "mcdowsa01", "mcdowsa01", "mcdowsa01", "mcdowsa01", "mcdowsa01", "mcdowsa01", "mcdowsa01", "mcdowsa01", "mcdowsa01", "mcdowsa01", "mcdowsa01", "mcdowsa01", "mcdowsa01", "mcdowsa01", "mcdowsa01",
+#> "mcdowsa01", "merriji01", "merriji01", "merriji01", "merriji01", "merriji01", "merriji01", "merriji01", "merriji01", "merriji01", "merriji01", "merriji01", "tolanbo01", "tolanbo01", "tolanbo01", "tolanbo01", "tolanbo01", "tolanbo01", "tolanbo01", "tolanbo01", "tolanbo01", "tolanbo01", "tolanbo01", "tolanbo01", "tolanbo01", "tolanbo01", "bluevi01", "bluevi01", "bluevi01", "bluevi01", "bluevi01", "bluevi01", "bluevi01", "bluevi01", "bluevi01", "bluevi01", "bluevi01", "bluevi01", "bluevi01", "bluevi01",
+#> "bluevi01", "bluevi01", "bluevi01", "otisam01", "otisam01", "otisam01", "otisam01", "otisam01", "otisam01", "otisam01", "otisam01", "otisam01", "otisam01", "otisam01", "otisam01", "otisam01", "otisam01", "otisam01", "otisam01", "otisam01", "bondsbo01", "bondsbo01", "bondsbo01", "bondsbo01", "bondsbo01", "bondsbo01", "bondsbo01", "bondsbo01", "bondsbo01", "bondsbo01", "bondsbo01", "bondsbo01", "bondsbo01", "bondsbo01", "bondsbo01", "daviswi02", "daviswi02", "daviswi02", "daviswi02", "daviswi02", "daviswi02",
+#> "daviswi02", "daviswi02", "daviswi02", "daviswi02", "daviswi02", "daviswi02", "daviswi02", "daviswi02", "daviswi02", "daviswi02", "daviswi02", "daviswi02", "daviswi02", "harrebu01", "harrebu01", "harrebu01", "harrebu01", "harrebu01", "harrebu01", "harrebu01", "harrebu01", "harrebu01", "harrebu01", "harrebu01", "harrebu01", "harrebu01", "harrebu01", "harrebu01", "harrebu01", "chambch01", "chambch01", "chambch01", "chambch01", "chambch01", "chambch01", "chambch01", "chambch01", "chambch01", "chambch01",
+#> "chambch01", "chambch01", "chambch01", "chambch01", "chambch01", "chambch01", "chambch01", "chambch01", "williea02", "williea02", "williea02", "williea02", "williea02", "williea02", "williea02", "williea02", "williea02", "rojasco01", "rojasco01", "rojasco01", "rojasco01", "rojasco01", "rojasco01", "rojasco01", "rojasco01", "rojasco01", "rojasco01", "rojasco01", "rojasco01", "rojasco01", "rojasco01", "rojasco01", "rojasco01", "rojasco01", "murcebo01", "murcebo01", "murcebo01", "murcebo01", "murcebo01",
+#> "murcebo01", "murcebo01", "murcebo01", "murcebo01", "murcebo01", "murcebo01", "murcebo01", "murcebo01", "murcebo01", "murcebo01", "murcebo01", "murcebo01", "murcebo01", "retteme01", "retteme01", "retteme01", "retteme01", "retteme01", "retteme01", "retteme01", "retteme01", "retteme01", "retteme01", "retteme01", "retteme01", "retteme01", "palmeji01", "palmeji01", "palmeji01", "palmeji01", "palmeji01", "palmeji01", "palmeji01", "palmeji01", "palmeji01", "palmeji01", "palmeji01", "palmeji01", "palmeji01",
+#> "palmeji01", "palmeji01", "palmeji01", "palmeji01", "palmeji01", "palmeji01", "mayle01", "mayle01", "mayle01", "mayle01", "mayle01", "mayle01", "mayle01", "mayle01", "mayle01", "mayle01", "mayle01", "mayle01", "mayle01", "mayle01", "mayle01", "mayle01", "mayle01", "mayle01", "sanguma01", "sanguma01", "sanguma01", "sanguma01", "sanguma01", "sanguma01", "sanguma01", "sanguma01", "sanguma01", "sanguma01", "sanguma01", "sanguma01", "sanguma01", "sandeke01", "sandeke01", "sandeke01", "sandeke01", "sandeke01",
+#> "sandeke01", "sandeke01", "sandeke01", "sandeke01", "sandeke01", "sandeke01", "sandeke01", "sandeke01", "sandeke01", "giustda01", "giustda01", "giustda01", "giustda01", "giustda01", "giustda01", "giustda01", "giustda01", "giustda01", "giustda01", "giustda01", "giustda01", "giustda01", "giustda01", "giustda01", "giustda01", "morgajo02", "morgajo02", "morgajo02", "morgajo02", "morgajo02", "morgajo02", "morgajo02", "morgajo02", "morgajo02", "morgajo02", "morgajo02", "morgajo02", "morgajo02", "morgajo02",
+#> "morgajo02", "morgajo02", "morgajo02", "morgajo02", "morgajo02", "morgajo02", "morgajo02", "morgajo02", "tenacge01", "tenacge01", "tenacge01", "tenacge01", "tenacge01", "tenacge01", "tenacge01", "tenacge01", "tenacge01", "tenacge01", "tenacge01", "tenacge01", "tenacge01", "tenacge01", "tenacge01", "perryga01", "perryga01", "perryga01", "perryga01", "perryga01", "perryga01", "perryga01", "perryga01", "perryga01", "perryga01", "perryga01", "perryga01", "perryga01", "perryga01", "perryga01", "perryga01",
+#> "perryga01", "perryga01", "perryga01", "perryga01", "perryga01", "perryga01", "perryga01", "perryga01", "perryga01", "griffdo01", "griffdo01", "griffdo01", "griffdo01", "griffdo01", "griffdo01", "griffdo01", "griffdo01", "fiskca01", "fiskca01", "fiskca01", "fiskca01", "fiskca01", "fiskca01", "fiskca01", "fiskca01", "fiskca01", "fiskca01", "fiskca01", "fiskca01", "fiskca01", "fiskca01", "fiskca01", "fiskca01", "fiskca01", "fiskca01", "fiskca01", "fiskca01", "fiskca01", "fiskca01", "fiskca01", "fiskca01",
+#> "brinked01", "brinked01", "brinked01", "brinked01", "brinked01", "brinked01", "brinked01", "brinked01", "brinked01", "brinked01", "brinked01", "brinked01", "brinked01", "brinked01", "brinked01", "brinked01", "brinked01", "cedence01", "cedence01", "cedence01", "cedence01", "cedence01", "cedence01", "cedence01", "cedence01", "cedence01", "cedence01", "cedence01", "cedence01", "cedence01", "cedence01", "cedence01", "cedence01", "cedence01", "cedence01", "bowala01", "bowala01", "bowala01", "bowala01",
+#> "bowala01", "bowala01", "bowala01", "bowala01", "bowala01", "bowala01", "bowala01", "bowala01", "bowala01", "bowala01", "bowala01", "bowala01", "bowala01", "matlajo01", "matlajo01", "matlajo01", "matlajo01", "matlajo01", "matlajo01", "matlajo01", "matlajo01", "matlajo01", "matlajo01", "matlajo01", "matlajo01", "matlajo01", "rudijo01", "rudijo01", "rudijo01", "rudijo01", "rudijo01", "rudijo01", "rudijo01", "rudijo01", "rudijo01", "rudijo01", "rudijo01", "rudijo01", "rudijo01", "rudijo01", "rudijo01",
+#> "rudijo01", "scheiri01", "scheiri01", "scheiri01", "scheiri01", "scheiri01", "scheiri01", "scheiri01", "scheiri01", "scheiri01", "scheiri01", "scheiri01", "speiech01", "speiech01", "speiech01", "speiech01", "speiech01", "speiech01", "speiech01", "speiech01", "speiech01", "speiech01", "speiech01", "speiech01", "speiech01", "speiech01", "speiech01", "speiech01", "speiech01", "speiech01", "speiech01", "speiech01", "speiech01", "speiech01", "lylesp01", "lylesp01", "lylesp01", "lylesp01", "lylesp01",
+#> "lylesp01", "lylesp01", "lylesp01", "lylesp01", "lylesp01", "lylesp01", "lylesp01", "lylesp01", "lylesp01", "lylesp01", "lylesp01", "lylesp01", "lylesp01", "carrocl02", "carrocl02", "carrocl02", "carrocl02", "carrocl02", "carrocl02", "carrocl02", "carrocl02", "carrocl02", "carrocl02", "carrocl02", "carrocl02", "carrocl02", "carrocl02", "carrocl02", "carrocl02", "carrocl02", "campabe01", "campabe01", "campabe01", "campabe01", "campabe01", "campabe01", "campabe01", "campabe01", "campabe01", "campabe01",
+#> "campabe01", "campabe01", "campabe01", "campabe01", "campabe01", "campabe01", "campabe01", "campabe01", "campabe01", "campabe01", "grichbo01", "grichbo01", "grichbo01", "grichbo01", "grichbo01", "grichbo01", "grichbo01", "grichbo01", "grichbo01", "grichbo01", "grichbo01", "grichbo01", "grichbo01", "grichbo01", "grichbo01", "grichbo01", "grichbo01", "jorgemi01", "jorgemi01", "jorgemi01", "jorgemi01", "jorgemi01", "jorgemi01", "jorgemi01", "jorgemi01", "jorgemi01", "jorgemi01", "jorgemi01", "jorgemi01",
+#> "jorgemi01", "jorgemi01", "jorgemi01", "jorgemi01", "jorgemi01", "jorgemi01", "jorgemi01", "jorgemi01", "metzgro01", "metzgro01", "metzgro01", "metzgro01", "metzgro01", "metzgro01", "metzgro01", "metzgro01", "metzgro01", "metzgro01", "metzgro01", "metzgro01", "hillejo01", "hillejo01", "hillejo01", "hillejo01", "hillejo01", "hillejo01", "hillejo01", "hillejo01", "hillejo01", "hillejo01", "hillejo01", "hillejo01", "hillejo01", "hillejo01", "hillejo01", "bumbral01", "bumbral01", "bumbral01", "bumbral01",
+#> "bumbral01", "bumbral01", "bumbral01", "bumbral01", "bumbral01", "bumbral01", "bumbral01", "bumbral01", "bumbral01", "bumbral01", "matthga01", "matthga01", "matthga01", "matthga01", "matthga01", "matthga01", "matthga01", "matthga01", "matthga01", "matthga01", "matthga01", "matthga01", "matthga01", "matthga01", "matthga01", "matthga01", "matthga01", "maybejo01", "maybejo01", "maybejo01", "maybejo01", "maybejo01", "maybejo01", "maybejo01", "maybejo01", "maybejo01", "maybejo01", "maybejo01", "maybejo01",
+#> "maybejo01", "maybejo01", "maybejo01", "maybejo01", "bandosa01", "bandosa01", "bandosa01", "bandosa01", "bandosa01", "bandosa01", "bandosa01", "bandosa01", "bandosa01", "bandosa01", "bandosa01", "bandosa01", "bandosa01", "bandosa01", "bandosa01", "bandosa01", "holtzke01", "holtzke01", "holtzke01", "holtzke01", "holtzke01", "holtzke01", "holtzke01", "holtzke01", "holtzke01", "holtzke01", "holtzke01", "holtzke01", "holtzke01", "holtzke01", "holtzke01", "holtzke01", "holtzke01", "evansda01", "evansda01",
+#> "evansda01", "evansda01", "evansda01", "evansda01", "evansda01", "evansda01", "evansda01", "evansda01", "evansda01", "evansda01", "evansda01", "evansda01", "evansda01", "evansda01", "evansda01", "evansda01", "evansda01", "evansda01", "evansda01", "evansda01", "bryanro01", "bryanro01", "bryanro01", "bryanro01", "bryanro01", "bryanro01", "bryanro01", "bryanro01", "russebi01", "russebi01", "russebi01", "russebi01", "russebi01", "russebi01", "russebi01", "russebi01", "russebi01", "russebi01", "russebi01",
+#> "russebi01", "russebi01", "russebi01", "russebi01", "russebi01", "russebi01", "russebi01", "marshmi01", "marshmi01", "marshmi01", "marshmi01", "marshmi01", "marshmi01", "marshmi01", "marshmi01", "marshmi01", "marshmi01", "marshmi01", "marshmi01", "marshmi01", "marshmi01", "marshmi01", "marshmi01", "marshmi01", "garvest01", "garvest01", "garvest01", "garvest01", "garvest01", "garvest01", "garvest01", "garvest01", "garvest01", "garvest01", "garvest01", "garvest01", "garvest01", "garvest01", "garvest01",
+#> "garvest01", "garvest01", "garvest01", "garvest01", "greendi01", "greendi01", "greendi01", "greendi01", "greendi01", "greendi01", "greendi01", "greendi01", "greendi01", "greendi01", "greendi01", "greendi01", "hunteca01", "hunteca01", "hunteca01", "hunteca01", "hunteca01", "hunteca01", "hunteca01", "hunteca01", "hunteca01", "hunteca01", "hunteca01", "hunteca01", "hunteca01", "hunteca01", "hunteca01", "geronce01", "geronce01", "geronce01", "geronce01", "geronce01", "geronce01", "geronce01", "geronce01",
+#> "geronce01", "geronce01", "geronce01", "geronce01", "geronce01", "geronce01", "geronce01", "messean01", "messean01", "messean01", "messean01", "messean01", "messean01", "messean01", "messean01", "messean01", "messean01", "messean01", "messean01", "conceda01", "conceda01", "conceda01", "conceda01", "conceda01", "conceda01", "conceda01", "conceda01", "conceda01", "conceda01", "conceda01", "conceda01", "conceda01", "conceda01", "conceda01", "conceda01", "conceda01", "conceda01", "conceda01", "thompda01",
+#> "thompda01", "thompda01", "thompda01", "thompda01", "thompda01", "thompda01", "thompda01", "burroje01", "burroje01", "burroje01", "burroje01", "burroje01", "burroje01", "burroje01", "burroje01", "burroje01", "burroje01", "burroje01", "burroje01", "burroje01", "burroje01", "burroje01", "burroje01", "hargrmi01", "hargrmi01", "hargrmi01", "hargrmi01", "hargrmi01", "hargrmi01", "hargrmi01", "hargrmi01", "hargrmi01", "hargrmi01", "hargrmi01", "hargrmi01", "hargrmi01", "mcbriba01", "mcbriba01", "mcbriba01",
+#> "mcbriba01", "mcbriba01", "mcbriba01", "mcbriba01", "mcbriba01", "mcbriba01", "mcbriba01", "mcbriba01", "mcbriba01", "schmimi01", "schmimi01", "schmimi01", "schmimi01", "schmimi01", "schmimi01", "schmimi01", "schmimi01", "schmimi01", "schmimi01", "schmimi01", "schmimi01", "schmimi01", "schmimi01", "schmimi01", "schmimi01", "schmimi01", "schmimi01", "gulledo01", "gulledo01", "gulledo01", "gulledo01", "gulledo01", "gulledo01", "gulledo01", "gulledo01", "gulledo01", "ziskri01", "ziskri01", "ziskri01",
+#> "ziskri01", "ziskri01", "ziskri01", "ziskri01", "ziskri01", "ziskri01", "ziskri01", "ziskri01", "ziskri01", "ziskri01", "forstte01", "forstte01", "forstte01", "forstte01", "forstte01", "forstte01", "forstte01", "forstte01", "forstte01", "forstte01", "forstte01", "forstte01", "forstte01", "forstte01", "forstte01", "forstte01", "fingero01", "fingero01", "fingero01", "fingero01", "fingero01", "fingero01", "fingero01", "fingero01", "fingero01", "fingero01", "fingero01", "fingero01", "fingero01", "fingero01",
+#> "fingero01", "fingero01", "fingero01", "madlobi01", "madlobi01", "madlobi01", "madlobi01", "madlobi01", "madlobi01", "madlobi01", "madlobi01", "madlobi01", "madlobi01", "madlobi01", "madlobi01", "madlobi01", "madlobi01", "madlobi01", "madlobi01", "madlobi01", "madlobi01", "tiantlu01", "tiantlu01", "tiantlu01", "tiantlu01", "tiantlu01", "tiantlu01", "tiantlu01", "tiantlu01", "tiantlu01", "tiantlu01", "tiantlu01", "tiantlu01", "tiantlu01", "tiantlu01", "tiantlu01", "tiantlu01", "tiantlu01", "tiantlu01",
+#> "tiantlu01", "lynnfr01", "lynnfr01", "lynnfr01", "lynnfr01", "lynnfr01", "lynnfr01", "lynnfr01", "lynnfr01", "lynnfr01", "lynnfr01", "lynnfr01", "lynnfr01", "lynnfr01", "lynnfr01", "lynnfr01", "lynnfr01", "lynnfr01", "lynnfr01", "reitzke01", "reitzke01", "reitzke01", "reitzke01", "reitzke01", "reitzke01", "reitzke01", "reitzke01", "reitzke01", "reitzke01", "reitzke01", "maddoga01", "maddoga01", "maddoga01", "maddoga01", "maddoga01", "maddoga01", "maddoga01", "maddoga01", "maddoga01", "maddoga01",
+#> "maddoga01", "maddoga01", "maddoga01", "maddoga01", "maddoga01", "maddoga01", "nolanga01", "nolanga01", "nolanga01", "nolanga01", "nolanga01", "nolanga01", "nolanga01", "nolanga01", "nolanga01", "nolanga01", "nolanga01", "montejo01", "montejo01", "montejo01", "montejo01", "montejo01", "montejo01", "montejo01", "montejo01", "montejo01", "montejo01", "montejo01", "montejo01", "montejo01", "montejo01", "nettlgr01", "nettlgr01", "nettlgr01", "nettlgr01", "nettlgr01", "nettlgr01", "nettlgr01", "nettlgr01",
+#> "nettlgr01", "nettlgr01", "nettlgr01", "nettlgr01", "nettlgr01", "nettlgr01", "nettlgr01", "nettlgr01", "nettlgr01", "nettlgr01", "nettlgr01", "nettlgr01", "nettlgr01", "nettlgr01", "riceji01", "riceji01", "riceji01", "riceji01", "riceji01", "riceji01", "riceji01", "riceji01", "riceji01", "riceji01", "riceji01", "riceji01", "riceji01", "riceji01", "riceji01", "riceji01", "harrato01", "harrato01", "harrato01", "harrato01", "harrato01", "harrato01", "harrato01", "harrato01", "harrato01", "harrato01",
+#> "harrato01", "harrato01", "harrato01", "harrato01", "harrato01", "harrato01", "harrato01", "jonesra01", "jonesra01", "jonesra01", "jonesra01", "jonesra01", "jonesra01", "jonesra01", "jonesra01", "jonesra01", "jonesra01", "luzingr01", "luzingr01", "luzingr01", "luzingr01", "luzingr01", "luzingr01", "luzingr01", "luzingr01", "luzingr01", "luzingr01", "luzingr01", "luzingr01", "luzingr01", "luzingr01", "luzingr01", "oliveal01", "oliveal01", "oliveal01", "oliveal01", "oliveal01", "oliveal01", "oliveal01",
+#> "oliveal01", "oliveal01", "oliveal01", "oliveal01", "oliveal01", "oliveal01", "oliveal01", "oliveal01", "oliveal01", "oliveal01", "oliveal01", "oliveal01", "oliveal01", "parkeda01", "parkeda01", "parkeda01", "parkeda01", "parkeda01", "parkeda01", "parkeda01", "parkeda01", "parkeda01", "parkeda01", "parkeda01", "parkeda01", "parkeda01", "parkeda01", "parkeda01", "parkeda01", "parkeda01", "parkeda01", "parkeda01", "parkeda01", "gossari01", "gossari01", "gossari01", "gossari01", "gossari01", "gossari01",
+#> "gossari01", "gossari01", "gossari01", "gossari01", "gossari01", "gossari01", "gossari01", "gossari01", "gossari01", "gossari01", "gossari01", "gossari01", "gossari01", "gossari01", "gossari01", "gossari01", "gossari01", "hraboal01", "hraboal01", "hraboal01", "hraboal01", "hraboal01", "hraboal01", "hraboal01", "hraboal01", "hraboal01", "hraboal01", "hraboal01", "hraboal01", "hraboal01", "fostege01", "fostege01", "fostege01", "fostege01", "fostege01", "fostege01", "fostege01", "fostege01", "fostege01",
+#> "fostege01", "fostege01", "fostege01", "fostege01", "fostege01", "fostege01", "fostege01", "fostege01", "fostege01", "fostege01", "fostege01", "rodriau01", "rodriau01", "rodriau01", "rodriau01", "rodriau01", "rodriau01", "rodriau01", "rodriau01", "rodriau01", "rodriau01", "rodriau01", "rodriau01", "rodriau01", "rodriau01", "rodriau01", "rodriau01", "rodriau01", "rodriau01", "rodriau01", "rodriau01", "sundbji01", "sundbji01", "sundbji01", "sundbji01", "sundbji01", "sundbji01", "sundbji01", "sundbji01",
+#> "sundbji01", "sundbji01", "sundbji01", "sundbji01", "sundbji01", "sundbji01", "sundbji01", "sundbji01", "sundbji01", "evansdw01", "evansdw01", "evansdw01", "evansdw01", "evansdw01", "evansdw01", "evansdw01", "evansdw01", "evansdw01", "evansdw01", "evansdw01", "evansdw01", "evansdw01", "evansdw01", "evansdw01", "evansdw01", "evansdw01", "evansdw01", "evansdw01", "evansdw01", "manniri01", "manniri01", "manniri01", "manniri01", "manniri01", "manniri01", "manniri01", "manniri01", "manniri01", "manniri01",
+#> "manniri01", "manniri01", "manniri01", "manniri01", "johnto01", "johnto01", "johnto01", "johnto01", "johnto01", "johnto01", "johnto01", "johnto01", "johnto01", "johnto01", "johnto01", "johnto01", "johnto01", "johnto01", "johnto01", "johnto01", "johnto01", "johnto01", "johnto01", "johnto01", "johnto01", "johnto01", "johnto01", "johnto01", "johnto01", "johnto01", "johnto01", "johnto01", "suttodo01", "suttodo01", "suttodo01", "suttodo01", "suttodo01", "suttodo01", "suttodo01", "suttodo01", "suttodo01",
+#> "suttodo01", "suttodo01", "suttodo01", "suttodo01", "suttodo01", "suttodo01", "suttodo01", "suttodo01", "suttodo01", "suttodo01", "suttodo01", "suttodo01", "suttodo01", "suttodo01", "suttodo01", "suttodo01", "campbbi02", "campbbi02", "campbbi02", "campbbi02", "campbbi02", "campbbi02", "campbbi02", "campbbi02", "campbbi02", "campbbi02", "campbbi02", "campbbi02", "campbbi02", "campbbi02", "campbbi02", "eastwra01", "eastwra01", "eastwra01", "eastwra01", "eastwra01", "eastwra01", "eastwra01", "eastwra01",
+#> "eastwra01", "eastwra01", "fidryma01", "fidryma01", "fidryma01", "fidryma01", "fidryma01", "metzgbu01", "metzgbu01", "metzgbu01", "metzgbu01", "metzgbu01", "metzgbu01", "zachrpa01", "zachrpa01", "zachrpa01", "zachrpa01", "zachrpa01", "zachrpa01", "zachrpa01", "zachrpa01", "zachrpa01", "zachrpa01", "zachrpa01", "brettge01", "brettge01", "brettge01", "brettge01", "brettge01", "brettge01", "brettge01", "brettge01", "brettge01", "brettge01", "brettge01", "brettge01", "brettge01", "brettge01", "brettge01",
+#> "brettge01", "brettge01", "brettge01", "brettge01", "brettge01", "brettge01", "mcraeha01", "mcraeha01", "mcraeha01", "mcraeha01", "mcraeha01", "mcraeha01", "mcraeha01", "mcraeha01", "mcraeha01", "mcraeha01", "mcraeha01", "mcraeha01", "mcraeha01", "mcraeha01", "mcraeha01", "mcraeha01", "mcraeha01", "mcraeha01", "mcraeha01", "tananfr01", "tananfr01", "tananfr01", "tananfr01", "tananfr01", "tananfr01", "tananfr01", "tananfr01", "tananfr01", "tananfr01", "tananfr01", "tananfr01", "tananfr01", "tananfr01",
+#> "tananfr01", "tananfr01", "tananfr01", "tananfr01", "tananfr01", "tananfr01", "tananfr01", "tananfr01", "tananfr01", "rivermi01", "rivermi01", "rivermi01", "rivermi01", "rivermi01", "rivermi01", "rivermi01", "rivermi01", "rivermi01", "rivermi01", "rivermi01", "rivermi01", "rivermi01", "rivermi01", "rivermi01", "rivermi01", "montawi01", "montawi01", "montawi01", "montawi01", "montawi01", "montawi01", "montawi01", "montawi01", "montawi01", "montawi01", "montawi01", "montawi01", "montawi01", "montawi01",
+#> "montawi01", "montawi01", "montawi01", "montawi01", "montawi01", "montawi01", "boonebo01", "boonebo01", "boonebo01", "boonebo01", "boonebo01", "boonebo01", "boonebo01", "boonebo01", "boonebo01", "boonebo01", "boonebo01", "boonebo01", "boonebo01", "boonebo01", "boonebo01", "boonebo01", "boonebo01", "boonebo01", "boonebo01", "griffke01", "griffke01", "griffke01", "griffke01", "griffke01", "griffke01", "griffke01", "griffke01", "griffke01", "griffke01", "griffke01", "griffke01", "griffke01", "griffke01",
+#> "griffke01", "griffke01", "griffke01", "griffke01", "griffke01", "griffke01", "griffke01", "griffke01", "whitefr01", "whitefr01", "whitefr01", "whitefr01", "whitefr01", "whitefr01", "whitefr01", "whitefr01", "whitefr01", "whitefr01", "whitefr01", "whitefr01", "whitefr01", "whitefr01", "whitefr01", "whitefr01", "whitefr01", "whitefr01", "beniqju01", "beniqju01", "beniqju01", "beniqju01", "beniqju01", "beniqju01", "beniqju01", "beniqju01", "beniqju01", "beniqju01", "beniqju01", "beniqju01", "beniqju01",
+#> "beniqju01", "beniqju01", "beniqju01", "beniqju01", "beniqju01", "cowenal01", "cowenal01", "cowenal01", "cowenal01", "cowenal01", "cowenal01", "cowenal01", "cowenal01", "cowenal01", "cowenal01", "cowenal01", "cowenal01", "cowenal01", "cowenal01", "bakerdu01", "bakerdu01", "bakerdu01", "bakerdu01", "bakerdu01", "bakerdu01", "bakerdu01", "bakerdu01", "bakerdu01", "bakerdu01", "bakerdu01", "bakerdu01", "bakerdu01", "bakerdu01", "bakerdu01", "bakerdu01", "bakerdu01", "bakerdu01", "bakerdu01", "murraed02",
+#> "murraed02", "murraed02", "murraed02", "murraed02", "murraed02", "murraed02", "murraed02", "murraed02", "murraed02", "murraed02", "murraed02", "murraed02", "murraed02", "murraed02", "murraed02", "murraed02", "murraed02", "murraed02", "murraed02", "murraed02", "murraed02", "murraed02", "dawsoan01", "dawsoan01", "dawsoan01", "dawsoan01", "dawsoan01", "dawsoan01", "dawsoan01", "dawsoan01", "dawsoan01", "dawsoan01", "dawsoan01", "dawsoan01", "dawsoan01", "dawsoan01", "dawsoan01", "dawsoan01", "dawsoan01",
+#> "dawsoan01", "dawsoan01", "dawsoan01", "dawsoan01", "randowi01", "randowi01", "randowi01", "randowi01", "randowi01", "randowi01", "randowi01", "randowi01", "randowi01", "randowi01", "randowi01", "randowi01", "randowi01", "randowi01", "randowi01", "randowi01", "randowi01", "randowi01", "randowi01", "hislela01", "hislela01", "hislela01", "hislela01", "hislela01", "hislela01", "hislela01", "hislela01", "hislela01", "hislela01", "hislela01", "hislela01", "hislela01", "hislela01", "ryanno01", "ryanno01",
+#> "ryanno01", "ryanno01", "ryanno01", "ryanno01", "ryanno01", "ryanno01", "ryanno01", "ryanno01", "ryanno01", "ryanno01", "ryanno01", "ryanno01", "ryanno01", "ryanno01", "ryanno01", "ryanno01", "ryanno01", "ryanno01", "ryanno01", "ryanno01", "ryanno01", "ryanno01", "ryanno01", "ryanno01", "ryanno01", "burleri01", "burleri01", "burleri01", "burleri01", "burleri01", "burleri01", "burleri01", "burleri01", "burleri01", "burleri01", "burleri01", "burleri01", "burleri01", "simmote01", "simmote01", "simmote01",
+#> "simmote01", "simmote01", "simmote01", "simmote01", "simmote01", "simmote01", "simmote01", "simmote01", "simmote01", "simmote01", "simmote01", "simmote01", "simmote01", "simmote01", "simmote01", "simmote01", "simmote01", "simmote01", "reuscri01", "reuscri01", "reuscri01", "reuscri01", "reuscri01", "reuscri01", "reuscri01", "reuscri01", "reuscri01", "reuscri01", "reuscri01", "reuscri01", "reuscri01", "reuscri01", "reuscri01", "reuscri01", "reuscri01", "reuscri01", "reuscri01", "reuscri01", "reuscri01",
+#> "templga01", "templga01", "templga01", "templga01", "templga01", "templga01", "templga01", "templga01", "templga01", "templga01", "templga01", "templga01", "templga01", "templga01", "templga01", "templga01", "templga01", "dentbu01", "dentbu01", "dentbu01", "dentbu01", "dentbu01", "dentbu01", "dentbu01", "dentbu01", "dentbu01", "dentbu01", "dentbu01", "dentbu01", "dentbu01", "guidrro01", "guidrro01", "guidrro01", "guidrro01", "guidrro01", "guidrro01", "guidrro01", "guidrro01", "guidrro01", "guidrro01",
+#> "guidrro01", "guidrro01", "guidrro01", "guidrro01", "milleri01", "milleri01", "milleri01", "milleri01", "milleri01", "milleri01", "milleri01", "milleri01", "milleri01", "milleri01", "milleri01", "milleri01", "milleri01", "milleri01", "milleri01", "hernake01", "hernake01", "hernake01", "hernake01", "hernake01", "hernake01", "hernake01", "hernake01", "hernake01", "hernake01", "hernake01", "hernake01", "hernake01", "hernake01", "hernake01", "hernake01", "hernake01", "hernake01", "lopesda01", "lopesda01",
+#> "lopesda01", "lopesda01", "lopesda01", "lopesda01", "lopesda01", "lopesda01", "lopesda01", "lopesda01", "lopesda01", "lopesda01", "lopesda01", "lopesda01", "lopesda01", "lopesda01", "lopesda01", "lopesda01", "valenel01", "valenel01", "valenel01", "valenel01", "valenel01", "valenel01", "valenel01", "valenel01", "valenel01", "valenel01", "valenel01", "niekrph01", "niekrph01", "niekrph01", "niekrph01", "niekrph01", "niekrph01", "niekrph01", "niekrph01", "niekrph01", "niekrph01", "niekrph01", "niekrph01",
+#> "niekrph01", "niekrph01", "niekrph01", "niekrph01", "niekrph01", "niekrph01", "niekrph01", "niekrph01", "niekrph01", "niekrph01", "niekrph01", "niekrph01", "niekrph01", "niekrph01", "whitalo01", "whitalo01", "whitalo01", "whitalo01", "whitalo01", "whitalo01", "whitalo01", "whitalo01", "whitalo01", "whitalo01", "whitalo01", "whitalo01", "whitalo01", "whitalo01", "whitalo01", "whitalo01", "whitalo01", "whitalo01", "whitalo01", "hornebo01", "hornebo01", "hornebo01", "hornebo01", "hornebo01", "hornebo01",
+#> "hornebo01", "hornebo01", "hornebo01", "hornebo01", "staubru01", "staubru01", "staubru01", "staubru01", "staubru01", "staubru01", "staubru01", "staubru01", "staubru01", "staubru01", "staubru01", "staubru01", "staubru01", "staubru01", "staubru01", "staubru01", "staubru01", "staubru01", "staubru01", "staubru01", "staubru01", "staubru01", "staubru01", "staubru01", "yountro01", "yountro01", "yountro01", "yountro01", "yountro01", "yountro01", "yountro01", "yountro01", "yountro01", "yountro01", "yountro01",
+#> "yountro01", "yountro01", "yountro01", "yountro01", "yountro01", "yountro01", "yountro01", "yountro01", "yountro01", "clarkja01", "clarkja01", "clarkja01", "clarkja01", "clarkja01", "clarkja01", "clarkja01", "clarkja01", "clarkja01", "clarkja01", "clarkja01", "clarkja01", "clarkja01", "clarkja01", "clarkja01", "clarkja01", "clarkja01", "clarkja01", "flanami01", "flanami01", "flanami01", "flanami01", "flanami01", "flanami01", "flanami01", "flanami01", "flanami01", "flanami01", "flanami01", "flanami01",
+#> "flanami01", "flanami01", "flanami01", "flanami01", "flanami01", "flanami01", "flanami01", "suttebr01", "suttebr01", "suttebr01", "suttebr01", "suttebr01", "suttebr01", "suttebr01", "suttebr01", "suttebr01", "suttebr01", "suttebr01", "suttebr01", "coopece01", "coopece01", "coopece01", "coopece01", "coopece01", "coopece01", "coopece01", "coopece01", "coopece01", "coopece01", "coopece01", "coopece01", "coopece01", "coopece01", "coopece01", "coopece01", "coopece01", "bellbu01", "bellbu01", "bellbu01",
+#> "bellbu01", "bellbu01", "bellbu01", "bellbu01", "bellbu01", "bellbu01", "bellbu01", "bellbu01", "bellbu01", "bellbu01", "bellbu01", "bellbu01", "bellbu01", "bellbu01", "bellbu01", "bellbu01", "bellbu01", "lezcasi01", "lezcasi01", "lezcasi01", "lezcasi01", "lezcasi01", "lezcasi01", "lezcasi01", "lezcasi01", "lezcasi01", "lezcasi01", "lezcasi01", "lezcasi01", "lezcasi01", "trillma01", "trillma01", "trillma01", "trillma01", "trillma01", "trillma01", "trillma01", "trillma01", "trillma01", "trillma01",
+#> "trillma01", "trillma01", "trillma01", "trillma01", "trillma01", "trillma01", "trillma01", "trillma01", "winfida01", "winfida01", "winfida01", "winfida01", "winfida01", "winfida01", "winfida01", "winfida01", "winfida01", "winfida01", "winfida01", "winfida01", "winfida01", "winfida01", "winfida01", "winfida01", "winfida01", "winfida01", "winfida01", "winfida01", "winfida01", "winfida01", "winfida01", "baylodo01", "baylodo01", "baylodo01", "baylodo01", "baylodo01", "baylodo01", "baylodo01", "baylodo01",
+#> "baylodo01", "baylodo01", "baylodo01", "baylodo01", "baylodo01", "baylodo01", "baylodo01", "baylodo01", "baylodo01", "baylodo01", "baylodo01", "baylodo01", "thornan01", "thornan01", "thornan01", "thornan01", "thornan01", "thornan01", "thornan01", "thornan01", "thornan01", "thornan01", "thornan01", "thornan01", "thornan01", "thornan01", "thornan01", "kernji01", "kernji01", "kernji01", "kernji01", "kernji01", "kernji01", "kernji01", "kernji01", "kernji01", "kernji01", "kernji01", "kernji01", "kernji01",
+#> "kernji01", "kernji01", "castijo01", "castijo01", "castijo01", "castijo01", "castijo01", "castijo01", "griffal01", "griffal01", "griffal01", "griffal01", "griffal01", "griffal01", "griffal01", "griffal01", "griffal01", "griffal01", "griffal01", "griffal01", "griffal01", "griffal01", "griffal01", "griffal01", "griffal01", "griffal01", "sutclri01", "sutclri01", "sutclri01", "sutclri01", "sutclri01", "sutclri01", "sutclri01", "sutclri01", "sutclri01", "sutclri01", "sutclri01", "sutclri01", "sutclri01",
+#> "sutclri01", "sutclri01", "sutclri01", "sutclri01", "sutclri01", "sutclri01", "porteda02", "porteda02", "porteda02", "porteda02", "porteda02", "porteda02", "porteda02", "porteda02", "porteda02", "porteda02", "porteda02", "porteda02", "porteda02", "porteda02", "porteda02", "porteda02", "porteda02", "singlke01", "singlke01", "singlke01", "singlke01", "singlke01", "singlke01", "singlke01", "singlke01", "singlke01", "singlke01", "singlke01", "singlke01", "singlke01", "singlke01", "singlke01", "smallro02",
+#> "smallro02", "smallro02", "smallro02", "smallro02", "smallro02", "smallro02", "smallro02", "smallro02", "smallro02", "smallro02", "smallro02", "smallro02", "smallro02", "smallro02", "smallro02", "kingmda01", "kingmda01", "kingmda01", "kingmda01", "kingmda01", "kingmda01", "kingmda01", "kingmda01", "kingmda01", "kingmda01", "kingmda01", "kingmda01", "kingmda01", "kingmda01", "kingmda01", "kingmda01", "kingmda01", "kingmda01", "kingmda01", "morenom01", "morenom01", "morenom01", "morenom01", "morenom01",
+#> "morenom01", "morenom01", "morenom01", "morenom01", "morenom01", "morenom01", "morenom01", "morenom01", "morenom01", "niekrjo01", "niekrjo01", "niekrjo01", "niekrjo01", "niekrjo01", "niekrjo01", "niekrjo01", "niekrjo01", "niekrjo01", "niekrjo01", "niekrjo01", "niekrjo01", "niekrjo01", "niekrjo01", "niekrjo01", "niekrjo01", "niekrjo01", "niekrjo01", "niekrjo01", "niekrjo01", "niekrjo01", "niekrjo01", "niekrjo01", "niekrjo01", "niekrjo01", "mcgratu01", "mcgratu01", "mcgratu01", "mcgratu01", "mcgratu01",
+#> "mcgratu01", "mcgratu01", "mcgratu01", "mcgratu01", "mcgratu01", "mcgratu01", "mcgratu01", "mcgratu01", "mcgratu01", "mcgratu01", "mcgratu01", "mcgratu01", "mcgratu01", "mcgratu01", "stonest01", "stonest01", "stonest01", "stonest01", "stonest01", "stonest01", "stonest01", "stonest01", "stonest01", "stonest01", "stonest01", "murphdw01", "murphdw01", "murphdw01", "murphdw01", "murphdw01", "murphdw01", "murphdw01", "murphdw01", "murphdw01", "murphdw01", "murphdw01", "murphdw01", "wilsowi02", "wilsowi02",
+#> "wilsowi02", "wilsowi02", "wilsowi02", "wilsowi02", "wilsowi02", "wilsowi02", "wilsowi02", "wilsowi02", "wilsowi02", "wilsowi02", "wilsowi02", "wilsowi02", "wilsowi02", "wilsowi02", "wilsowi02", "wilsowi02", "wilsowi02", "norrimi01", "norrimi01", "norrimi01", "norrimi01", "norrimi01", "norrimi01", "norrimi01", "norrimi01", "norrimi01", "norrimi01", "trammal01", "trammal01", "trammal01", "trammal01", "trammal01", "trammal01", "trammal01", "trammal01", "trammal01", "trammal01", "trammal01", "trammal01",
+#> "trammal01", "trammal01", "trammal01", "trammal01", "trammal01", "trammal01", "trammal01", "trammal01", "flynndo01", "flynndo01", "flynndo01", "flynndo01", "flynndo01", "flynndo01", "flynndo01", "flynndo01", "flynndo01", "flynndo01", "flynndo01", "flynndo01", "flynndo01", "flynndo01", "cartega01", "cartega01", "cartega01", "cartega01", "cartega01", "cartega01", "cartega01", "cartega01", "cartega01", "cartega01", "cartega01", "cartega01", "cartega01", "cartega01", "cartega01", "cartega01", "cartega01",
+#> "cartega01", "cartega01", "smithoz01", "smithoz01", "smithoz01", "smithoz01", "smithoz01", "smithoz01", "smithoz01", "smithoz01", "smithoz01", "smithoz01", "smithoz01", "smithoz01", "smithoz01", "smithoz01", "smithoz01", "smithoz01", "smithoz01", "smithoz01", "smithoz01", "quiseda01", "quiseda01", "quiseda01", "quiseda01", "quiseda01", "quiseda01", "quiseda01", "quiseda01", "quiseda01", "quiseda01", "quiseda01", "quiseda01", "quiseda01", "charbjo01", "charbjo01", "charbjo01", "howest01", "howest01",
+#> "howest01", "howest01", "howest01", "howest01", "howest01", "howest01", "howest01", "howest01", "howest01", "howest01", "howest01", "parrila02", "parrila02", "parrila02", "parrila02", "parrila02", "parrila02", "parrila02", "parrila02", "parrila02", "parrila02", "parrila02", "parrila02", "parrila02", "parrila02", "parrila02", "parrila02", "parrila02", "parrila02", "parrila02", "parrila02", "oglivbe01", "oglivbe01", "oglivbe01", "oglivbe01", "oglivbe01", "oglivbe01", "oglivbe01", "oglivbe01", "oglivbe01",
+#> "oglivbe01", "oglivbe01", "oglivbe01", "oglivbe01", "oglivbe01", "oglivbe01", "oglivbe01", "hendrge01", "hendrge01", "hendrge01", "hendrge01", "hendrge01", "hendrge01", "hendrge01", "hendrge01", "hendrge01", "hendrge01", "hendrge01", "hendrge01", "hendrge01", "hendrge01", "hendrge01", "hendrge01", "hendrge01", "hendrge01", "hendrge01", "hendrge01", "forscbo01", "forscbo01", "forscbo01", "forscbo01", "forscbo01", "forscbo01", "forscbo01", "forscbo01", "forscbo01", "forscbo01", "forscbo01", "forscbo01",
+#> "forscbo01", "forscbo01", "forscbo01", "forscbo01", "forscbo01", "ceronri01", "ceronri01", "ceronri01", "ceronri01", "ceronri01", "ceronri01", "ceronri01", "ceronri01", "ceronri01", "ceronri01", "ceronri01", "ceronri01", "ceronri01", "ceronri01", "ceronri01", "ceronri01", "ceronri01", "ceronri01", "bibbyji01", "bibbyji01", "bibbyji01", "bibbyji01", "bibbyji01", "bibbyji01", "bibbyji01", "bibbyji01", "bibbyji01", "bibbyji01", "bibbyji01", "bibbyji01", "bibbyji01", "bibbyji01", "humeto01", "humeto01",
+#> "humeto01", "humeto01", "humeto01", "humeto01", "humeto01", "humeto01", "humeto01", "humeto01", "humeto01", "humeto01", "ceyro01", "ceyro01", "ceyro01", "ceyro01", "ceyro01", "ceyro01", "ceyro01", "ceyro01", "ceyro01", "ceyro01", "ceyro01", "ceyro01", "ceyro01", "ceyro01", "ceyro01", "ceyro01", "ceyro01", "valenfe01", "valenfe01", "valenfe01", "valenfe01", "valenfe01", "valenfe01", "valenfe01", "valenfe01", "valenfe01", "valenfe01", "valenfe01", "valenfe01", "valenfe01", "valenfe01", "valenfe01",
+#> "valenfe01", "valenfe01", "valenfe01", "squirmi01", "squirmi01", "squirmi01", "squirmi01", "squirmi01", "squirmi01", "squirmi01", "squirmi01", "squirmi01", "squirmi01", "henderi01", "henderi01", "henderi01", "henderi01", "henderi01", "henderi01", "henderi01", "henderi01", "henderi01", "henderi01", "henderi01", "henderi01", "henderi01", "henderi01", "henderi01", "henderi01", "henderi01", "henderi01", "henderi01", "henderi01", "henderi01", "henderi01", "henderi01", "henderi01", "henderi01", "henderi01",
+#> "henderi01", "henderi01", "henderi01", "hootobu01", "hootobu01", "hootobu01", "hootobu01", "hootobu01", "hootobu01", "hootobu01", "hootobu01", "hootobu01", "hootobu01", "hootobu01", "hootobu01", "hootobu01", "hootobu01", "hootobu01", "hootobu01", "righeda01", "righeda01", "righeda01", "righeda01", "righeda01", "righeda01", "righeda01", "righeda01", "righeda01", "righeda01", "righeda01", "righeda01", "righeda01", "righeda01", "righeda01", "righeda01", "righeda01", "lansfca01", "lansfca01", "lansfca01",
+#> "lansfca01", "lansfca01", "lansfca01", "lansfca01", "lansfca01", "lansfca01", "lansfca01", "lansfca01", "lansfca01", "lansfca01", "lansfca01", "lansfca01", "armasto01", "armasto01", "armasto01", "armasto01", "armasto01", "armasto01", "armasto01", "armasto01", "armasto01", "armasto01", "armasto01", "armasto01", "armasto01", "armasto01", "morrija02", "morrija02", "morrija02", "morrija02", "morrija02", "morrija02", "morrija02", "morrija02", "morrija02", "morrija02", "morrija02", "morrija02", "morrija02",
+#> "morrija02", "morrija02", "morrija02", "morrija02", "morrija02", "guerrpe01", "guerrpe01", "guerrpe01", "guerrpe01", "guerrpe01", "guerrpe01", "guerrpe01", "guerrpe01", "guerrpe01", "guerrpe01", "guerrpe01", "guerrpe01", "guerrpe01", "guerrpe01", "guerrpe01", "guerrpe01", "yeagest01", "yeagest01", "yeagest01", "yeagest01", "yeagest01", "yeagest01", "yeagest01", "yeagest01", "yeagest01", "yeagest01", "yeagest01", "yeagest01", "yeagest01", "yeagest01", "yeagest01", "vuckope01", "vuckope01", "vuckope01",
+#> "vuckope01", "vuckope01", "vuckope01", "vuckope01", "vuckope01", "vuckope01", "vuckope01", "vuckope01", "murphda05", "murphda05", "murphda05", "murphda05", "murphda05", "murphda05", "murphda05", "murphda05", "murphda05", "murphda05", "murphda05", "murphda05", "murphda05", "murphda05", "murphda05", "murphda05", "murphda05", "murphda05", "murphda05", "ripkeca01", "ripkeca01", "ripkeca01", "ripkeca01", "ripkeca01", "ripkeca01", "ripkeca01", "ripkeca01", "ripkeca01", "ripkeca01", "ripkeca01", "ripkeca01",
+#> "ripkeca01", "ripkeca01", "ripkeca01", "ripkeca01", "ripkeca01", "ripkeca01", "ripkeca01", "ripkeca01", "ripkeca01", "saxst01", "saxst01", "saxst01", "saxst01", "saxst01", "saxst01", "saxst01", "saxst01", "saxst01", "saxst01", "saxst01", "saxst01", "saxst01", "saxst01", "garcida01", "garcida01", "garcida01", "garcida01", "garcida01", "garcida01", "garcida01", "garcida01", "garcida01", "garcida01", "garcida01", "decindo01", "decindo01", "decindo01", "decindo01", "decindo01", "decindo01", "decindo01",
+#> "decindo01", "decindo01", "decindo01", "decindo01", "decindo01", "decindo01", "decindo01", "decindo01", "decindo01", "durhale01", "durhale01", "durhale01", "durhale01", "durhale01", "durhale01", "durhale01", "durhale01", "durhale01", "durhale01", "durhale01", "robindo01", "robindo01", "robindo01", "robindo01", "robindo01", "robindo01", "robindo01", "robindo01", "robindo01", "robindo01", "robindo01", "robindo01", "robindo01", "robindo01", "robindo01", "robindo01", "robindo01", "zahnge01", "zahnge01",
+#> "zahnge01", "zahnge01", "zahnge01", "zahnge01", "zahnge01", "zahnge01", "zahnge01", "zahnge01", "zahnge01", "zahnge01", "zahnge01", "zahnge01", "thomago01", "thomago01", "thomago01", "thomago01", "thomago01", "thomago01", "thomago01", "thomago01", "thomago01", "thomago01", "thomago01", "thomago01", "thomago01", "thomago01", "thomago01", "stiebda01", "stiebda01", "stiebda01", "stiebda01", "stiebda01", "stiebda01", "stiebda01", "stiebda01", "stiebda01", "stiebda01", "stiebda01", "stiebda01", "stiebda01",
+#> "stiebda01", "stiebda01", "stiebda01", "smithlo01", "smithlo01", "smithlo01", "smithlo01", "smithlo01", "smithlo01", "smithlo01", "smithlo01", "smithlo01", "smithlo01", "smithlo01", "smithlo01", "smithlo01", "smithlo01", "smithlo01", "smithlo01", "smithlo01", "smithlo01", "smithlo01", "rogerst01", "rogerst01", "rogerst01", "rogerst01", "rogerst01", "rogerst01", "rogerst01", "rogerst01", "rogerst01", "rogerst01", "rogerst01", "rogerst01", "rogerst01", "boddimi01", "boddimi01", "boddimi01", "boddimi01",
+#> "boddimi01", "boddimi01", "boddimi01", "boddimi01", "boddimi01", "boddimi01", "boddimi01", "boddimi01", "boddimi01", "boddimi01", "boddimi01", "dempsri01", "dempsri01", "dempsri01", "dempsri01", "dempsri01", "dempsri01", "dempsri01", "dempsri01", "dempsri01", "dempsri01", "dempsri01", "dempsri01", "dempsri01", "dempsri01", "dempsri01", "dempsri01", "dempsri01", "dempsri01", "dempsri01", "dempsri01", "dempsri01", "dempsri01", "dempsri01", "dempsri01", "dempsri01", "hoytla01", "hoytla01", "hoytla01",
+#> "hoytla01", "hoytla01", "hoytla01", "hoytla01", "hoytla01", "dennyjo01", "dennyjo01", "dennyjo01", "dennyjo01", "dennyjo01", "dennyjo01", "dennyjo01", "dennyjo01", "dennyjo01", "dennyjo01", "dennyjo01", "dennyjo01", "dennyjo01", "dennyjo01", "sandbry01", "sandbry01", "sandbry01", "sandbry01", "sandbry01", "sandbry01", "sandbry01", "sandbry01", "sandbry01", "sandbry01", "sandbry01", "sandbry01", "sandbry01", "sandbry01", "sandbry01", "sandbry01", "penato01", "penato01", "penato01", "penato01", "penato01",
+#> "penato01", "penato01", "penato01", "penato01", "penato01", "penato01", "penato01", "penato01", "penato01", "penato01", "penato01", "penato01", "penato01", "penato01", "mcgeewi01", "mcgeewi01", "mcgeewi01", "mcgeewi01", "mcgeewi01", "mcgeewi01", "mcgeewi01", "mcgeewi01", "mcgeewi01", "mcgeewi01", "mcgeewi01", "mcgeewi01", "mcgeewi01", "mcgeewi01", "mcgeewi01", "mcgeewi01", "mcgeewi01", "mcgeewi01", "mcgeewi01", "knighra01", "knighra01", "knighra01", "knighra01", "knighra01", "knighra01", "knighra01",
+#> "knighra01", "knighra01", "knighra01", "knighra01", "knighra01", "knighra01", "knighra01", "hollaal01", "hollaal01", "hollaal01", "hollaal01", "hollaal01", "hollaal01", "hollaal01", "hollaal01", "hollaal01", "hollaal01", "hollaal01", "hollaal01", "kittlro01", "kittlro01", "kittlro01", "kittlro01", "kittlro01", "kittlro01", "kittlro01", "kittlro01", "kittlro01", "kittlro01", "kittlro01", "kittlro01", "strawda01", "strawda01", "strawda01", "strawda01", "strawda01", "strawda01", "strawda01", "strawda01",
+#> "strawda01", "strawda01", "strawda01", "strawda01", "strawda01", "strawda01", "strawda01", "strawda01", "strawda01", "boggswa01", "boggswa01", "boggswa01", "boggswa01", "boggswa01", "boggswa01", "boggswa01", "boggswa01", "boggswa01", "boggswa01", "boggswa01", "boggswa01", "boggswa01", "boggswa01", "boggswa01", "boggswa01", "boggswa01", "boggswa01", "mosebll01", "mosebll01", "mosebll01", "mosebll01", "mosebll01", "mosebll01", "mosebll01", "mosebll01", "mosebll01", "mosebll01", "mosebll01", "mosebll01",
+#> "rayjo01", "rayjo01", "rayjo01", "rayjo01", "rayjo01", "rayjo01", "rayjo01", "rayjo01", "rayjo01", "rayjo01", "rayjo01", "kennete02", "kennete02", "kennete02", "kennete02", "kennete02", "kennete02", "kennete02", "kennete02", "kennete02", "kennete02", "kennete02", "kennete02", "kennete02", "kennete02", "cruzjo01", "cruzjo01", "cruzjo01", "cruzjo01", "cruzjo01", "cruzjo01", "cruzjo01", "cruzjo01", "cruzjo01", "cruzjo01", "cruzjo01", "cruzjo01", "cruzjo01", "cruzjo01", "cruzjo01", "cruzjo01", "cruzjo01",
+#> "cruzjo01", "cruzjo01", "thondi01", "thondi01", "thondi01", "thondi01", "thondi01", "thondi01", "thondi01", "thondi01", "thondi01", "thondi01", "thondi01", "thondi01", "thondi01", "thondi01", "thondi01", "hubbagl01", "hubbagl01", "hubbagl01", "hubbagl01", "hubbagl01", "hubbagl01", "hubbagl01", "hubbagl01", "hubbagl01", "hubbagl01", "hubbagl01", "hubbagl01", "mcwilla01", "mcwilla01", "mcwilla01", "mcwilla01", "mcwilla01", "mcwilla01", "mcwilla01", "mcwilla01", "mcwilla01", "mcwilla01", "mcwilla01",
+#> "mcwilla01", "mcwilla01", "mcwilla01", "mcwilla01", "raineti01", "raineti01", "raineti01", "raineti01", "raineti01", "raineti01", "raineti01", "raineti01", "raineti01", "raineti01", "raineti01", "raineti01", "raineti01", "raineti01", "raineti01", "raineti01", "raineti01", "raineti01", "raineti01", "raineti01", "raineti01", "raineti01", "raineti01", "raineti01", "smithle02", "smithle02", "smithle02", "smithle02", "smithle02", "smithle02", "smithle02", "smithle02", "smithle02", "smithle02", "smithle02",
+#> "smithle02", "smithle02", "smithle02", "smithle02", "smithle02", "smithle02", "smithle02", "smithle02", "smithle02", "smithle02", "gibsoki01", "gibsoki01", "gibsoki01", "gibsoki01", "gibsoki01", "gibsoki01", "gibsoki01", "gibsoki01", "gibsoki01", "gibsoki01", "gibsoki01", "gibsoki01", "gibsoki01", "gibsoki01", "gibsoki01", "gibsoki01", "gibsoki01", "hernawi01", "hernawi01", "hernawi01", "hernawi01", "hernawi01", "hernawi01", "hernawi01", "hernawi01", "hernawi01", "hernawi01", "hernawi01", "hernawi01",
+#> "hernawi01", "hernawi01", "dernibo01", "dernibo01", "dernibo01", "dernibo01", "dernibo01", "dernibo01", "dernibo01", "dernibo01", "dernibo01", "dernibo01", "andujjo01", "andujjo01", "andujjo01", "andujjo01", "andujjo01", "andujjo01", "andujjo01", "andujjo01", "andujjo01", "andujjo01", "andujjo01", "andujjo01", "andujjo01", "andujjo01", "davisal01", "davisal01", "davisal01", "davisal01", "davisal01", "davisal01", "davisal01", "davisal01", "davisal01", "goodedw01", "goodedw01", "goodedw01", "goodedw01",
+#> "goodedw01", "goodedw01", "goodedw01", "goodedw01", "goodedw01", "goodedw01", "goodedw01", "goodedw01", "goodedw01", "goodedw01", "goodedw01", "goodedw01", "goodedw01", "goodedw01", "gwynnto01", "gwynnto01", "gwynnto01", "gwynnto01", "gwynnto01", "gwynnto01", "gwynnto01", "gwynnto01", "gwynnto01", "gwynnto01", "gwynnto01", "gwynnto01", "gwynnto01", "gwynnto01", "gwynnto01", "gwynnto01", "gwynnto01", "gwynnto01", "gwynnto01", "gwynnto01", "rhoderi01", "rhoderi01", "rhoderi01", "rhoderi01", "rhoderi01",
+#> "rhoderi01", "rhoderi01", "rhoderi01", "rhoderi01", "rhoderi01", "rhoderi01", "rhoderi01", "rhoderi01", "rhoderi01", "rhoderi01", "rhoderi01", "mattido01", "mattido01", "mattido01", "mattido01", "mattido01", "mattido01", "mattido01", "mattido01", "mattido01", "mattido01", "mattido01", "mattido01", "mattido01", "mattido01", "thurmma01", "thurmma01", "thurmma01", "thurmma01", "thurmma01", "thurmma01", "thurmma01", "thurmma01", "thurmma01", "saberbr01", "saberbr01", "saberbr01", "saberbr01", "saberbr01",
+#> "saberbr01", "saberbr01", "saberbr01", "saberbr01", "saberbr01", "saberbr01", "saberbr01", "saberbr01", "saberbr01", "saberbr01", "saberbr01", "saberbr01", "pettiga01", "pettiga01", "pettiga01", "pettiga01", "pettiga01", "pettiga01", "pettiga01", "pettiga01", "pettiga01", "pettiga01", "pettiga01", "pettiga01", "wallati01", "wallati01", "wallati01", "wallati01", "wallati01", "wallati01", "wallati01", "wallati01", "wallati01", "wallati01", "wallati01", "wallati01", "wallati01", "wallati01", "wallati01",
+#> "wallati01", "wallati01", "wallati01", "reardje01", "reardje01", "reardje01", "reardje01", "reardje01", "reardje01", "reardje01", "reardje01", "reardje01", "reardje01", "reardje01", "reardje01", "reardje01", "reardje01", "reardje01", "reardje01", "reardje01", "reardje01", "guilloz01", "guilloz01", "guilloz01", "guilloz01", "guilloz01", "guilloz01", "guilloz01", "guilloz01", "guilloz01", "guilloz01", "guilloz01", "guilloz01", "guilloz01", "guilloz01", "guilloz01", "guilloz01", "guilloz01", "colemvi01",
+#> "colemvi01", "colemvi01", "colemvi01", "colemvi01", "colemvi01", "colemvi01", "colemvi01", "colemvi01", "colemvi01", "colemvi01", "colemvi01", "colemvi01", "colemvi01", "bellge02", "bellge02", "bellge02", "bellge02", "bellge02", "bellge02", "bellge02", "bellge02", "bellge02", "bellge02", "bellge02", "bellge02", "brookhu01", "brookhu01", "brookhu01", "brookhu01", "brookhu01", "brookhu01", "brookhu01", "brookhu01", "brookhu01", "brookhu01", "brookhu01", "brookhu01", "brookhu01", "brookhu01", "brookhu01",
+#> "baineha01", "baineha01", "baineha01", "baineha01", "baineha01", "baineha01", "baineha01", "baineha01", "baineha01", "baineha01", "baineha01", "baineha01", "baineha01", "baineha01", "baineha01", "baineha01", "baineha01", "baineha01", "baineha01", "baineha01", "baineha01", "baineha01", "baineha01", "baineha01", "baineha01", "baineha01", "baineha01", "bradlph01", "bradlph01", "bradlph01", "bradlph01", "bradlph01", "bradlph01", "bradlph01", "bradlph01", "bradlph01", "herrto01", "herrto01", "herrto01",
+#> "herrto01", "herrto01", "herrto01", "herrto01", "herrto01", "herrto01", "herrto01", "herrto01", "herrto01", "herrto01", "herrto01", "herrto01", "herrto01", "tudorjo01", "tudorjo01", "tudorjo01", "tudorjo01", "tudorjo01", "tudorjo01", "tudorjo01", "tudorjo01", "tudorjo01", "tudorjo01", "tudorjo01", "tudorjo01", "tudorjo01", "barrema02", "barrema02", "barrema02", "barrema02", "barrema02", "barrema02", "barrema02", "barrema02", "barrema02", "barrema02", "clemero02", "clemero02", "clemero02", "clemero02",
+#> "clemero02", "clemero02", "clemero02", "clemero02", "clemero02", "clemero02", "clemero02", "clemero02", "clemero02", "clemero02", "clemero02", "clemero02", "clemero02", "clemero02", "clemero02", "clemero02", "clemero02", "clemero02", "clemero02", "clemero02", "scottmi03", "scottmi03", "scottmi03", "scottmi03", "scottmi03", "scottmi03", "scottmi03", "scottmi03", "scottmi03", "scottmi03", "scottmi03", "scottmi03", "scottmi03", "gaettga01", "gaettga01", "gaettga01", "gaettga01", "gaettga01", "gaettga01",
+#> "gaettga01", "gaettga01", "gaettga01", "gaettga01", "gaettga01", "gaettga01", "gaettga01", "gaettga01", "gaettga01", "gaettga01", "gaettga01", "gaettga01", "gaettga01", "gaettga01", "gaettga01", "gaettga01", "barfije01", "barfije01", "barfije01", "barfije01", "barfije01", "barfije01", "barfije01", "barfije01", "barfije01", "barfije01", "barfije01", "barfije01", "barfije01", "puckeki01", "puckeki01", "puckeki01", "puckeki01", "puckeki01", "puckeki01", "puckeki01", "puckeki01", "puckeki01", "puckeki01",
+#> "puckeki01", "puckeki01", "fernato01", "fernato01", "fernato01", "fernato01", "fernato01", "fernato01", "fernato01", "fernato01", "fernato01", "fernato01", "fernato01", "fernato01", "fernato01", "fernato01", "fernato01", "fernato01", "fernato01", "fernato01", "fernato01", "davisjo02", "davisjo02", "davisjo02", "davisjo02", "davisjo02", "davisjo02", "davisjo02", "davisjo02", "davisjo02", "davisjo02", "davisjo02", "leonade01", "leonade01", "leonade01", "leonade01", "leonade01", "leonade01", "leonade01",
+#> "leonade01", "leonade01", "leonade01", "leonade01", "leonade01", "worreto01", "worreto01", "worreto01", "worreto01", "worreto01", "worreto01", "worreto01", "worreto01", "worreto01", "worreto01", "worreto01", "cansejo01", "cansejo01", "cansejo01", "cansejo01", "cansejo01", "cansejo01", "cansejo01", "cansejo01", "cansejo01", "cansejo01", "cansejo01", "cansejo01", "cansejo01", "cansejo01", "cansejo01", "cansejo01", "cansejo01", "cansejo01", "cansejo01", "davisgl01", "davisgl01", "davisgl01", "davisgl01",
+#> "davisgl01", "davisgl01", "davisgl01", "davisgl01", "davisgl01", "davisgl01", "bernato01", "bernato01", "bernato01", "bernato01", "bernato01", "bernato01", "bernato01", "bernato01", "bernato01", "bernato01", "bernato01", "bernato01", "gedmari01", "gedmari01", "gedmari01", "gedmari01", "gedmari01", "gedmari01", "gedmari01", "gedmari01", "gedmari01", "gedmari01", "gedmari01", "gedmari01", "gedmari01", "gedmari01", "higuete01", "higuete01", "higuete01", "higuete01", "higuete01", "higuete01", "higuete01",
+#> "higuete01", "higuete01", "violafr01", "violafr01", "violafr01", "violafr01", "violafr01", "violafr01", "violafr01", "violafr01", "violafr01", "violafr01", "violafr01", "violafr01", "violafr01", "violafr01", "violafr01", "violafr01", "bedrost01", "bedrost01", "bedrost01", "bedrost01", "bedrost01", "bedrost01", "bedrost01", "bedrost01", "bedrost01", "bedrost01", "bedrost01", "bedrost01", "bedrost01", "bedrost01", "bedrost01", "langsma01", "langsma01", "langsma01", "langsma01", "langsma01", "langsma01",
+#> "langsma01", "langsma01", "langsma01", "langsma01", "langsma01", "langsma01", "langsma01", "langsma01", "langsma01", "langsma01", "langsma01", "pendlte01", "pendlte01", "pendlte01", "pendlte01", "pendlte01", "pendlte01", "pendlte01", "pendlte01", "pendlte01", "pendlte01", "pendlte01", "pendlte01", "pendlte01", "pendlte01", "pendlte01", "pendlte01", "lavalmi01", "lavalmi01", "lavalmi01", "lavalmi01", "lavalmi01", "lavalmi01", "lavalmi01", "lavalmi01", "lavalmi01", "lavalmi01", "lavalmi01", "lavalmi01",
+#> "lavalmi01", "daviser01", "daviser01", "daviser01", "daviser01", "daviser01", "daviser01", "daviser01", "daviser01", "daviser01", "daviser01", "daviser01", "daviser01", "daviser01", "daviser01", "daviser01", "daviser01", "daviser01", "daviser01", "molitpa01", "molitpa01", "molitpa01", "molitpa01", "molitpa01", "molitpa01", "molitpa01", "molitpa01", "molitpa01", "molitpa01", "molitpa01", "molitpa01", "molitpa01", "molitpa01", "molitpa01", "molitpa01", "molitpa01", "molitpa01", "molitpa01", "molitpa01",
+#> "molitpa01", "leonaje01", "leonaje01", "leonaje01", "leonaje01", "leonaje01", "leonaje01", "leonaje01", "leonaje01", "leonaje01", "leonaje01", "leonaje01", "leonaje01", "leonaje01", "leonaje01", "leonaje01", "leonaje01", "mcgwima01", "mcgwima01", "mcgwima01", "mcgwima01", "mcgwima01", "mcgwima01", "mcgwima01", "mcgwima01", "mcgwima01", "mcgwima01", "mcgwima01", "mcgwima01", "mcgwima01", "mcgwima01", "mcgwima01", "mcgwima01", "mcgwima01", "santibe01", "santibe01", "santibe01", "santibe01", "santibe01",
+#> "santibe01", "santibe01", "santibe01", "santibe01", "santibe01", "santibe01", "santibe01", "santibe01", "santibe01", "santibe01", "santibe01", "santibe01", "santibe01", "santibe01", "santibe01", "nokesma01", "nokesma01", "nokesma01", "nokesma01", "nokesma01", "nokesma01", "nokesma01", "nokesma01", "nokesma01", "nokesma01", "nokesma01", "nokesma01", "nokesma01", "samueju01", "samueju01", "samueju01", "samueju01", "samueju01", "samueju01", "samueju01", "samueju01", "samueju01", "samueju01", "samueju01",
+#> "samueju01", "samueju01", "samueju01", "samueju01", "samueju01", "samueju01", "samueju01", "samueju01", "keyji01", "keyji01", "keyji01", "keyji01", "keyji01", "keyji01", "keyji01", "keyji01", "keyji01", "keyji01", "keyji01", "keyji01", "keyji01", "keyji01", "keyji01", "smithza01", "smithza01", "smithza01", "smithza01", "smithza01", "smithza01", "smithza01", "smithza01", "smithza01", "smithza01", "smithza01", "smithza01", "smithza01", "smithza01", "smithza01", "eckerde01", "eckerde01", "eckerde01",
+#> "eckerde01", "eckerde01", "eckerde01", "eckerde01", "eckerde01", "eckerde01", "eckerde01", "eckerde01", "eckerde01", "eckerde01", "eckerde01", "eckerde01", "eckerde01", "eckerde01", "eckerde01", "eckerde01", "eckerde01", "eckerde01", "eckerde01", "eckerde01", "eckerde01", "eckerde01", "steinte01", "steinte01", "steinte01", "steinte01", "steinte01", "steinte01", "steinte01", "steinte01", "steinte01", "steinte01", "steinte01", "steinte01", "steinte01", "steinte01", "hershor01", "hershor01", "hershor01",
+#> "hershor01", "hershor01", "hershor01", "hershor01", "hershor01", "hershor01", "hershor01", "hershor01", "hershor01", "hershor01", "hershor01", "hershor01", "hershor01", "hershor01", "hershor01", "reynoha01", "reynoha01", "reynoha01", "reynoha01", "reynoha01", "reynoha01", "reynoha01", "reynoha01", "reynoha01", "reynoha01", "reynoha01", "reynoha01", "whitede03", "whitede03", "whitede03", "whitede03", "whitede03", "whitede03", "whitede03", "whitede03", "whitede03", "whitede03", "whitede03", "whitede03",
+#> "whitede03", "whitede03", "whitede03", "whitede03", "whitede03", "vanslan01", "vanslan01", "vanslan01", "vanslan01", "vanslan01", "vanslan01", "vanslan01", "vanslan01", "vanslan01", "vanslan01", "vanslan01", "vanslan01", "vanslan01", "vanslan01", "oestero01", "oestero01", "oestero01", "oestero01", "oestero01", "oestero01", "oestero01", "oestero01", "oestero01", "oestero01", "oestero01", "oestero01", "oestero01", "francjo01", "francjo01", "francjo01", "francjo01", "francjo01", "francjo01", "francjo01",
+#> "francjo01", "francjo01", "francjo01", "francjo01", "francjo01", "francjo01", "francjo01", "francjo01", "francjo01", "francjo01", "francjo01", "francjo01", "francjo01", "francjo01", "weisswa01", "weisswa01", "weisswa01", "weisswa01", "weisswa01", "weisswa01", "weisswa01", "weisswa01", "weisswa01", "weisswa01", "weisswa01", "weisswa01", "weisswa01", "weisswa01", "saboch01", "saboch01", "saboch01", "saboch01", "saboch01", "saboch01", "saboch01", "saboch01", "saboch01", "saboch01", "francju01", "francju01",
+#> "francju01", "francju01", "francju01", "francju01", "francju01", "francju01", "francju01", "francju01", "francju01", "francju01", "francju01", "francju01", "francju01", "francju01", "francju01", "francju01", "francju01", "francju01", "francju01", "francju01", "francju01", "francju01", "francju01", "greenmi01", "greenmi01", "greenmi01", "greenmi01", "greenmi01", "greenmi01", "greenmi01", "greenmi01", "greenmi01", "greenmi01", "greenmi01", "greenmi01", "galaran01", "galaran01", "galaran01", "galaran01",
+#> "galaran01", "galaran01", "galaran01", "galaran01", "galaran01", "galaran01", "galaran01", "galaran01", "galaran01", "galaran01", "galaran01", "galaran01", "galaran01", "galaran01", "galaran01", "galaran01", "bonilbo01", "bonilbo01", "bonilbo01", "bonilbo01", "bonilbo01", "bonilbo01", "bonilbo01", "bonilbo01", "bonilbo01", "bonilbo01", "bonilbo01", "bonilbo01", "bonilbo01", "bonilbo01", "bonilbo01", "bonilbo01", "bonilbo01", "bonilbo01", "bonilbo01", "learyti01", "learyti01", "learyti01", "learyti01",
+#> "learyti01", "learyti01", "learyti01", "learyti01", "learyti01", "learyti01", "learyti01", "learyti01", "learyti01", "learyti01", "learyti01", "larkiba01", "larkiba01", "larkiba01", "larkiba01", "larkiba01", "larkiba01", "larkiba01", "larkiba01", "larkiba01", "larkiba01", "larkiba01", "larkiba01", "larkiba01", "larkiba01", "larkiba01", "larkiba01", "larkiba01", "larkiba01", "larkiba01", "whitter01", "whitter01", "whitter01", "whitter01", "whitter01", "whitter01", "whitter01", "whitter01", "whitter01",
+#> "whitter01", "whitter01", "whitter01", "whitter01", "whitter01", "whitter01", "stewada01", "stewada01", "stewada01", "stewada01", "stewada01", "stewada01", "stewada01", "stewada01", "stewada01", "stewada01", "stewada01", "stewada01", "stewada01", "stewada01", "stewada01", "stewada01", "stewada01", "stewada01", "stewada01", "clarkwi02", "clarkwi02", "clarkwi02", "clarkwi02", "clarkwi02", "clarkwi02", "clarkwi02", "clarkwi02", "clarkwi02", "clarkwi02", "clarkwi02", "clarkwi02", "clarkwi02", "clarkwi02",
+#> "clarkwi02", "clarkwi02", "jacksda02", "jacksda02", "jacksda02", "jacksda02", "jacksda02", "jacksda02", "jacksda02", "jacksda02", "jacksda02", "jacksda02", "jacksda02", "jacksda02", "jacksda02", "jacksda02", "jacksda02", "jacksda02", "jacksda02", "mcreyke01", "mcreyke01", "mcreyke01", "mcreyke01", "mcreyke01", "mcreyke01", "mcreyke01", "mcreyke01", "mcreyke01", "mcreyke01", "mcreyke01", "mcreyke01", "jacksbo01", "jacksbo01", "jacksbo01", "jacksbo01", "jacksbo01", "jacksbo01", "jacksbo01", "jacksbo01",
+#> "davisma01", "davisma01", "davisma01", "davisma01", "davisma01", "davisma01", "davisma01", "davisma01", "davisma01", "davisma01", "davisma01", "davisma01", "davisma01", "davisma01", "davisma01", "davisma01", "davisma01", "davisma01", "darliro01", "darliro01", "darliro01", "darliro01", "darliro01", "darliro01", "darliro01", "darliro01", "darliro01", "darliro01", "darliro01", "darliro01", "darliro01", "darliro01", "darliro01", "draveda01", "draveda01", "draveda01", "draveda01", "draveda01", "draveda01",
+#> "draveda01", "draveda01", "draveda01", "mitchke01", "mitchke01", "mitchke01", "mitchke01", "mitchke01", "mitchke01", "mitchke01", "mitchke01", "mitchke01", "mitchke01", "mitchke01", "mitchke01", "mitchke01", "mitchke01", "mitchke01", "russeje01", "russeje01", "russeje01", "russeje01", "russeje01", "russeje01", "russeje01", "russeje01", "russeje01", "russeje01", "russeje01", "russeje01", "russeje01", "russeje01", "russeje01", "russeje01", "olsongr01", "olsongr01", "olsongr01", "olsongr01", "olsongr01",
+#> "olsongr01", "olsongr01", "olsongr01", "olsongr01", "olsongr01", "olsongr01", "olsongr01", "olsongr01", "olsongr01", "olsongr01", "olsongr01", "olsongr01", "waltoje01", "waltoje01", "waltoje01", "waltoje01", "waltoje01", "waltoje01", "waltoje01", "waltoje01", "waltoje01", "waltoje01", "mcgrifr01", "mcgrifr01", "mcgrifr01", "mcgrifr01", "mcgrifr01", "mcgrifr01", "mcgrifr01", "mcgrifr01", "mcgrifr01", "mcgrifr01", "mcgrifr01", "mcgrifr01", "mcgrifr01", "mcgrifr01", "mcgrifr01", "mcgrifr01", "mcgrifr01",
+#> "mcgrifr01", "mcgrifr01", "mcgrifr01", "mcgrifr01", "tettlmi01", "tettlmi01", "tettlmi01", "tettlmi01", "tettlmi01", "tettlmi01", "tettlmi01", "tettlmi01", "tettlmi01", "tettlmi01", "tettlmi01", "tettlmi01", "tettlmi01", "tettlmi01", "sierrru01", "sierrru01", "sierrru01", "sierrru01", "sierrru01", "sierrru01", "sierrru01", "sierrru01", "sierrru01", "sierrru01", "sierrru01", "sierrru01", "sierrru01", "sierrru01", "sierrru01", "sierrru01", "sierrru01", "sierrru01", "sierrru01", "sierrru01", "sierrru01",
+#> "sierrru01", "sierrru01", "sierrru01", "sierrru01", "johnsho01", "johnsho01", "johnsho01", "johnsho01", "johnsho01", "johnsho01", "johnsho01", "johnsho01", "johnsho01", "johnsho01", "johnsho01", "johnsho01", "johnsho01", "johnsho01", "biggicr01", "biggicr01", "biggicr01", "biggicr01", "biggicr01", "biggicr01", "biggicr01", "biggicr01", "biggicr01", "biggicr01", "biggicr01", "biggicr01", "biggicr01", "biggicr01", "biggicr01", "biggicr01", "biggicr01", "biggicr01", "biggicr01", "biggicr01", "finlech01",
+#> "finlech01", "finlech01", "finlech01", "finlech01", "finlech01", "finlech01", "finlech01", "finlech01", "finlech01", "finlech01", "finlech01", "finlech01", "finlech01", "finlech01", "finlech01", "finlech01", "finlech01", "dunstsh01", "dunstsh01", "dunstsh01", "dunstsh01", "dunstsh01", "dunstsh01", "dunstsh01", "dunstsh01", "dunstsh01", "dunstsh01", "dunstsh01", "dunstsh01", "dunstsh01", "dunstsh01", "dunstsh01", "dunstsh01", "dunstsh01", "dunstsh01", "dunstsh01", "dunstsh01", "dunstsh01", "hatchbi01",
+#> "hatchbi01", "hatchbi01", "hatchbi01", "hatchbi01", "hatchbi01", "hatchbi01", "hatchbi01", "hatchbi01", "hatchbi01", "hatchbi01", "hatchbi01", "hatchbi01", "hatchbi01", "hatchbi01", "welchbo01", "welchbo01", "welchbo01", "welchbo01", "welchbo01", "welchbo01", "welchbo01", "welchbo01", "welchbo01", "welchbo01", "welchbo01", "welchbo01", "welchbo01", "welchbo01", "welchbo01", "welchbo01", "welchbo01", "drabedo01", "drabedo01", "drabedo01", "drabedo01", "drabedo01", "drabedo01", "drabedo01", "drabedo01",
+#> "drabedo01", "drabedo01", "drabedo01", "drabedo01", "drabedo01", "grubeke01", "grubeke01", "grubeke01", "grubeke01", "grubeke01", "grubeke01", "grubeke01", "grubeke01", "grubeke01", "grubeke01", "alomasa02", "alomasa02", "alomasa02", "alomasa02", "alomasa02", "alomasa02", "alomasa02", "alomasa02", "alomasa02", "alomasa02", "alomasa02", "alomasa02", "alomasa02", "alomasa02", "alomasa02", "alomasa02", "alomasa02", "alomasa02", "alomasa02", "alomasa02", "alomasa02", "alomasa02", "burksel01", "burksel01",
+#> "burksel01", "burksel01", "burksel01", "burksel01", "burksel01", "burksel01", "burksel01", "burksel01", "burksel01", "burksel01", "burksel01", "burksel01", "burksel01", "burksel01", "burksel01", "burksel01", "burksel01", "griffke02", "griffke02", "griffke02", "griffke02", "griffke02", "griffke02", "griffke02", "griffke02", "griffke02", "griffke02", "griffke02", "griffke02", "griffke02", "griffke02", "griffke02", "griffke02", "griffke02", "griffke02", "griffke02", "griffke02", "griffke02", "griffke02",
+#> "griffke02", "bondsba01", "bondsba01", "bondsba01", "bondsba01", "bondsba01", "bondsba01", "bondsba01", "bondsba01", "bondsba01", "bondsba01", "bondsba01", "bondsba01", "bondsba01", "bondsba01", "bondsba01", "bondsba01", "bondsba01", "bondsba01", "bondsba01", "bondsba01", "bondsba01", "bondsba01", "maddugr01", "maddugr01", "maddugr01", "maddugr01", "maddugr01", "maddugr01", "maddugr01", "maddugr01", "maddugr01", "maddugr01", "maddugr01", "maddugr01", "maddugr01", "maddugr01", "maddugr01", "maddugr01",
+#> "maddugr01", "maddugr01", "maddugr01", "maddugr01", "maddugr01", "maddugr01", "maddugr01", "maddugr01", "maddugr01", "breamsi01", "breamsi01", "breamsi01", "breamsi01", "breamsi01", "breamsi01", "breamsi01", "breamsi01", "breamsi01", "breamsi01", "breamsi01", "breamsi01", "breamsi01", "dibblro01", "dibblro01", "dibblro01", "dibblro01", "dibblro01", "dibblro01", "dibblro01", "dibblro01", "myersra01", "myersra01", "myersra01", "myersra01", "myersra01", "myersra01", "myersra01", "myersra01", "myersra01",
+#> "myersra01", "myersra01", "myersra01", "myersra01", "myersra01", "myersra01", "thigpbo01", "thigpbo01", "thigpbo01", "thigpbo01", "thigpbo01", "thigpbo01", "thigpbo01", "thigpbo01", "thigpbo01", "thigpbo01", "justida01", "justida01", "justida01", "justida01", "justida01", "justida01", "justida01", "justida01", "justida01", "justida01", "justida01", "justida01", "justida01", "justida01", "justida01", "fieldce01", "fieldce01", "fieldce01", "fieldce01", "fieldce01", "fieldce01", "fieldce01", "fieldce01",
+#> "fieldce01", "fieldce01", "fieldce01", "fieldce01", "fieldce01", "fieldce01", "fieldce01", "willima04", "willima04", "willima04", "willima04", "willima04", "willima04", "willima04", "willima04", "willima04", "willima04", "willima04", "willima04", "willima04", "willima04", "willima04", "willima04", "willima04", "sciosmi01", "sciosmi01", "sciosmi01", "sciosmi01", "sciosmi01", "sciosmi01", "sciosmi01", "sciosmi01", "sciosmi01", "sciosmi01", "sciosmi01", "sciosmi01", "sciosmi01", "rijojo01", "rijojo01",
+#> "rijojo01", "rijojo01", "rijojo01", "rijojo01", "rijojo01", "rijojo01", "rijojo01", "rijojo01", "rijojo01", "rijojo01", "rijojo01", "rijojo01", "glavito02", "glavito02", "glavito02", "glavito02", "glavito02", "glavito02", "glavito02", "glavito02", "glavito02", "glavito02", "glavito02", "glavito02", "glavito02", "glavito02", "glavito02", "glavito02", "glavito02", "glavito02", "glavito02", "glavito02", "glavito02", "glavito02", "alomaro01", "alomaro01", "alomaro01", "alomaro01", "alomaro01", "alomaro01",
+#> "alomaro01", "alomaro01", "alomaro01", "alomaro01", "alomaro01", "alomaro01", "alomaro01", "alomaro01", "alomaro01", "alomaro01", "alomaro01", "alomaro01", "alomaro01", "venturo01", "venturo01", "venturo01", "venturo01", "venturo01", "venturo01", "venturo01", "venturo01", "venturo01", "venturo01", "venturo01", "venturo01", "venturo01", "venturo01", "venturo01", "venturo01", "venturo01", "pagnoto01", "pagnoto01", "pagnoto01", "pagnoto01", "pagnoto01", "pagnoto01", "pagnoto01", "pagnoto01", "pagnoto01",
+#> "pagnoto01", "pagnoto01", "pagnoto01", "wegmabi01", "wegmabi01", "wegmabi01", "wegmabi01", "wegmabi01", "wegmabi01", "wegmabi01", "wegmabi01", "wegmabi01", "wegmabi01", "wegmabi01", "hrbekke01", "hrbekke01", "hrbekke01", "hrbekke01", "hrbekke01", "hrbekke01", "hrbekke01", "hrbekke01", "hrbekke01", "hrbekke01", "hrbekke01", "hrbekke01", "hrbekke01", "hrbekke01", "averyst01", "averyst01", "averyst01", "averyst01", "averyst01", "averyst01", "averyst01", "averyst01", "averyst01", "averyst01", "averyst01",
+#> "harvebr01", "harvebr01", "harvebr01", "harvebr01", "harvebr01", "harvebr01", "harvebr01", "harvebr01", "harvebr01", "knoblch01", "knoblch01", "knoblch01", "knoblch01", "knoblch01", "knoblch01", "knoblch01", "knoblch01", "knoblch01", "knoblch01", "knoblch01", "knoblch01", "bagweje01", "bagweje01", "bagweje01", "bagweje01", "bagweje01", "bagweje01", "bagweje01", "bagweje01", "bagweje01", "bagweje01", "bagweje01", "bagweje01", "bagweje01", "bagweje01", "bagweje01", "thomafr04", "thomafr04", "thomafr04",
+#> "thomafr04", "thomafr04", "thomafr04", "thomafr04", "thomafr04", "thomafr04", "thomafr04", "thomafr04", "thomafr04", "thomafr04", "thomafr04", "thomafr04", "thomafr04", "thomafr04", "thomafr04", "thomafr04", "thomafr04", "cartejo01", "cartejo01", "cartejo01", "cartejo01", "cartejo01", "cartejo01", "cartejo01", "cartejo01", "cartejo01", "cartejo01", "cartejo01", "cartejo01", "cartejo01", "cartejo01", "cartejo01", "cartejo01", "cartejo01", "gantro01", "gantro01", "gantro01", "gantro01", "gantro01",
+#> "gantro01", "gantro01", "gantro01", "gantro01", "gantro01", "gantro01", "gantro01", "gantro01", "gantro01", "gantro01", "gantro01", "gantro01", "gantro01", "abbotji01", "abbotji01", "abbotji01", "abbotji01", "abbotji01", "abbotji01", "abbotji01", "abbotji01", "abbotji01", "abbotji01", "abbotji01", "rodriiv01", "rodriiv01", "rodriiv01", "rodriiv01", "rodriiv01", "rodriiv01", "rodriiv01", "rodriiv01", "rodriiv01", "rodriiv01", "rodriiv01", "rodriiv01", "rodriiv01", "rodriiv01", "rodriiv01", "rodriiv01",
+#> "rodriiv01", "rodriiv01", "rodriiv01", "rodriiv01", "rodriiv01", "rodriiv01", "rodriiv01", "gracema01", "gracema01", "gracema01", "gracema01", "gracema01", "gracema01", "gracema01", "gracema01", "gracema01", "gracema01", "gracema01", "gracema01", "gracema01", "gracema01", "gracema01", "gracema01", "lindjo01", "lindjo01", "lindjo01", "lindjo01", "lindjo01", "lindjo01", "lindjo01", "lindjo01", "lindjo01", "lindjo01", "walkela01", "walkela01", "walkela01", "walkela01", "walkela01", "walkela01", "walkela01",
+#> "walkela01", "walkela01", "walkela01", "walkela01", "walkela01", "walkela01", "walkela01", "walkela01", "walkela01", "walkela01", "walkela01", "smoltjo01", "smoltjo01", "smoltjo01", "smoltjo01", "smoltjo01", "smoltjo01", "smoltjo01", "smoltjo01", "smoltjo01", "smoltjo01", "smoltjo01", "smoltjo01", "smoltjo01", "smoltjo01", "smoltjo01", "smoltjo01", "smoltjo01", "smoltjo01", "smoltjo01", "smoltjo01", "smoltjo01", "smoltjo01", "listapa01", "listapa01", "listapa01", "listapa01", "listapa01", "listapa01",
+#> "karroer01", "karroer01", "karroer01", "karroer01", "karroer01", "karroer01", "karroer01", "karroer01", "karroer01", "karroer01", "karroer01", "karroer01", "karroer01", "karroer01", "martied01", "martied01", "martied01", "martied01", "martied01", "martied01", "martied01", "martied01", "martied01", "martied01", "martied01", "martied01", "martied01", "martied01", "martied01", "martied01", "martied01", "martied01", "gonzaju03", "gonzaju03", "gonzaju03", "gonzaju03", "gonzaju03", "gonzaju03", "gonzaju03",
+#> "gonzaju03", "gonzaju03", "gonzaju03", "gonzaju03", "gonzaju03", "gonzaju03", "gonzaju03", "gonzaju03", "gonzaju03", "gonzaju03", "frymatr01", "frymatr01", "frymatr01", "frymatr01", "frymatr01", "frymatr01", "frymatr01", "frymatr01", "frymatr01", "frymatr01", "frymatr01", "frymatr01", "frymatr01", "sheffga01", "sheffga01", "sheffga01", "sheffga01", "sheffga01", "sheffga01", "sheffga01", "sheffga01", "sheffga01", "sheffga01", "sheffga01", "sheffga01", "sheffga01", "sheffga01", "sheffga01", "sheffga01",
+#> "sheffga01", "sheffga01", "sheffga01", "sheffga01", "sheffga01", "sheffga01", "sheffga01", "sheffga01", "daultda01", "daultda01", "daultda01", "daultda01", "daultda01", "daultda01", "daultda01", "daultda01", "daultda01", "daultda01", "daultda01", "daultda01", "daultda01", "daultda01", "daultda01", "flemida01", "flemida01", "flemida01", "flemida01", "flemida01", "flemida01", "devermi01", "devermi01", "devermi01", "devermi01", "devermi01", "devermi01", "devermi01", "devermi01", "devermi01", "devermi01",
+#> "devermi01", "devermi01", "devermi01", "mcdowja01", "mcdowja01", "mcdowja01", "mcdowja01", "mcdowja01", "mcdowja01", "mcdowja01", "mcdowja01", "mcdowja01", "mcdowja01", "mcdowja01", "mcdowja01", "jonesdo01", "jonesdo01", "jonesdo01", "jonesdo01", "jonesdo01", "jonesdo01", "jonesdo01", "jonesdo01", "jonesdo01", "jonesdo01", "jonesdo01", "jonesdo01", "jonesdo01", "jonesdo01", "jonesdo01", "jonesdo01", "jonesdo01", "jonesdo01", "bordepa01", "bordepa01", "bordepa01", "bordepa01", "bordepa01", "bordepa01",
+#> "bordepa01", "bordepa01", "bordepa01", "bordepa01", "bordepa01", "bordepa01", "bordepa01", "bordepa01", "bordepa01", "bordepa01", "bordepa01", "bordepa01", "bordepa01", "bordepa01", "bordepa01", "bordepa01", "loftoke01", "loftoke01", "loftoke01", "loftoke01", "loftoke01", "loftoke01", "loftoke01", "loftoke01", "loftoke01", "loftoke01", "loftoke01", "loftoke01", "loftoke01", "loftoke01", "loftoke01", "loftoke01", "loftoke01", "loftoke01", "loftoke01", "loftoke01", "vizquom01", "vizquom01", "vizquom01",
+#> "vizquom01", "vizquom01", "vizquom01", "vizquom01", "vizquom01", "vizquom01", "vizquom01", "vizquom01", "vizquom01", "vizquom01", "vizquom01", "vizquom01", "vizquom01", "vizquom01", "vizquom01", "vizquom01", "vizquom01", "vizquom01", "vizquom01", "vizquom01", "vizquom01", "thompro01", "thompro01", "thompro01", "thompro01", "thompro01", "thompro01", "thompro01", "thompro01", "thompro01", "thompro01", "thompro01", "manwaki01", "manwaki01", "manwaki01", "manwaki01", "manwaki01", "manwaki01", "manwaki01",
+#> "manwaki01", "manwaki01", "manwaki01", "manwaki01", "manwaki01", "manwaki01", "manwaki01", "grissma02", "grissma02", "grissma02", "grissma02", "grissma02", "grissma02", "grissma02", "grissma02", "grissma02", "grissma02", "grissma02", "grissma02", "grissma02", "grissma02", "grissma02", "grissma02", "grissma02", "bellja01", "bellja01", "bellja01", "bellja01", "bellja01", "bellja01", "bellja01", "bellja01", "bellja01", "bellja01", "bellja01", "bellja01", "bellja01", "bellja01", "bellja01", "bellja01",
+#> "bellja01", "bellja01", "olerujo01", "olerujo01", "olerujo01", "olerujo01", "olerujo01", "olerujo01", "olerujo01", "olerujo01", "olerujo01", "olerujo01", "olerujo01", "olerujo01", "olerujo01", "olerujo01", "olerujo01", "olerujo01", "olerujo01", "olerujo01", "schilcu01", "schilcu01", "schilcu01", "schilcu01", "schilcu01", "schilcu01", "schilcu01", "schilcu01", "schilcu01", "schilcu01", "schilcu01", "schilcu01", "schilcu01", "schilcu01", "schilcu01", "schilcu01", "schilcu01", "schilcu01", "schilcu01",
+#> "schilcu01", "schilcu01", "montgje01", "montgje01", "montgje01", "montgje01", "montgje01", "montgje01", "montgje01", "montgje01", "montgje01", "montgje01", "montgje01", "montgje01", "montgje01", "salmoti01", "salmoti01", "salmoti01", "salmoti01", "salmoti01", "salmoti01", "salmoti01", "salmoti01", "salmoti01", "salmoti01", "salmoti01", "salmoti01", "salmoti01", "salmoti01", "piazzmi01", "piazzmi01", "piazzmi01", "piazzmi01", "piazzmi01", "piazzmi01", "piazzmi01", "piazzmi01", "piazzmi01", "piazzmi01",
+#> "piazzmi01", "piazzmi01", "piazzmi01", "piazzmi01", "piazzmi01", "piazzmi01", "piazzmi01", "piazzmi01", "baergca01", "baergca01", "baergca01", "baergca01", "baergca01", "baergca01", "baergca01", "baergca01", "baergca01", "baergca01", "baergca01", "baergca01", "baergca01", "baergca01", "baergca01", "baergca01", "stanlmi02", "stanlmi02", "stanlmi02", "stanlmi02", "stanlmi02", "stanlmi02", "stanlmi02", "stanlmi02", "stanlmi02", "stanlmi02", "stanlmi02", "stanlmi02", "stanlmi02", "stanlmi02", "stanlmi02",
+#> "stanlmi02", "stanlmi02", "stanlmi02", "belleal01", "belleal01", "belleal01", "belleal01", "belleal01", "belleal01", "belleal01", "belleal01", "belleal01", "belleal01", "belleal01", "belleal01", "dykstle01", "dykstle01", "dykstle01", "dykstle01", "dykstle01", "dykstle01", "dykstle01", "dykstle01", "dykstle01", "dykstle01", "dykstle01", "dykstle01", "dykstle01", "coneda01", "coneda01", "coneda01", "coneda01", "coneda01", "coneda01", "coneda01", "coneda01", "coneda01", "coneda01", "coneda01", "coneda01",
+#> "coneda01", "coneda01", "coneda01", "coneda01", "coneda01", "coneda01", "coneda01", "lewisda01", "lewisda01", "lewisda01", "lewisda01", "lewisda01", "lewisda01", "lewisda01", "lewisda01", "lewisda01", "lewisda01", "lewisda01", "lewisda01", "lewisda01", "lewisda01", "lewisda01", "beckro01", "beckro01", "beckro01", "beckro01", "beckro01", "beckro01", "beckro01", "beckro01", "beckro01", "beckro01", "beckro01", "beckro01", "beckro01", "beckro01", "hamelbo01", "hamelbo01", "hamelbo01", "hamelbo01", "hamelbo01",
+#> "hamelbo01", "mondera01", "mondera01", "mondera01", "mondera01", "mondera01", "mondera01", "mondera01", "mondera01", "mondera01", "mondera01", "mondera01", "mondera01", "mondera01", "mondera01", "mondera01", "mondera01", "aloumo01", "aloumo01", "aloumo01", "aloumo01", "aloumo01", "aloumo01", "aloumo01", "aloumo01", "aloumo01", "aloumo01", "aloumo01", "aloumo01", "aloumo01", "aloumo01", "aloumo01", "aloumo01", "aloumo01", "aloumo01", "portuma01", "portuma01", "portuma01", "portuma01", "portuma01",
+#> "portuma01", "portuma01", "portuma01", "portuma01", "portuma01", "portuma01", "portuma01", "portuma01", "portuma01", "portuma01", "portuma01", "cordewi01", "cordewi01", "cordewi01", "cordewi01", "cordewi01", "cordewi01", "cordewi01", "cordewi01", "cordewi01", "cordewi01", "cordewi01", "cordewi01", "cordewi01", "cordewi01", "cordewi01", "cordewi01", "coninje01", "coninje01", "coninje01", "coninje01", "coninje01", "coninje01", "coninje01", "coninje01", "coninje01", "coninje01", "coninje01", "coninje01",
+#> "coninje01", "coninje01", "coninje01", "coninje01", "coninje01", "coninje01", "coninje01", "coninje01", "johnsra05", "johnsra05", "johnsra05", "johnsra05", "johnsra05", "johnsra05", "johnsra05", "johnsra05", "johnsra05", "johnsra05", "johnsra05", "johnsra05", "johnsra05", "johnsra05", "johnsra05", "johnsra05", "johnsra05", "johnsra05", "johnsra05", "johnsra05", "johnsra05", "johnsra05", "johnsra05", "johnsra05", "snowjt01", "snowjt01", "snowjt01", "snowjt01", "snowjt01", "snowjt01", "snowjt01", "snowjt01",
+#> "snowjt01", "snowjt01", "snowjt01", "snowjt01", "snowjt01", "snowjt01", "snowjt01", "snowjt01", "caminke01", "caminke01", "caminke01", "caminke01", "caminke01", "caminke01", "caminke01", "caminke01", "caminke01", "caminke01", "caminke01", "caminke01", "caminke01", "caminke01", "caminke01", "caminke01", "johnsch04", "johnsch04", "johnsch04", "johnsch04", "johnsch04", "johnsch04", "johnsch04", "johnsch04", "johnsch04", "johnsch04", "johnsch04", "johnsch04", "johnsch04", "johnsch04", "finlest01", "finlest01",
+#> "finlest01", "finlest01", "finlest01", "finlest01", "finlest01", "finlest01", "finlest01", "finlest01", "finlest01", "finlest01", "finlest01", "finlest01", "finlest01", "finlest01", "finlest01", "finlest01", "finlest01", "finlest01", "vaughmo01", "vaughmo01", "vaughmo01", "vaughmo01", "vaughmo01", "vaughmo01", "vaughmo01", "vaughmo01", "vaughmo01", "vaughmo01", "vaughmo01", "vaughmo01", "mesajo01", "mesajo01", "mesajo01", "mesajo01", "mesajo01", "mesajo01", "mesajo01", "mesajo01", "mesajo01", "mesajo01",
+#> "mesajo01", "mesajo01", "mesajo01", "mesajo01", "mesajo01", "mesajo01", "mesajo01", "mesajo01", "mesajo01", "mesajo01", "mesajo01", "mesajo01", "henketo01", "henketo01", "henketo01", "henketo01", "henketo01", "henketo01", "henketo01", "henketo01", "henketo01", "henketo01", "henketo01", "henketo01", "henketo01", "henketo01", "cordoma01", "cordoma01", "cordoma01", "cordoma01", "cordoma01", "cordoma01", "cordoma01", "cordoma01", "cordoma01", "nomohi01", "nomohi01", "nomohi01", "nomohi01", "nomohi01",
+#> "nomohi01", "nomohi01", "nomohi01", "nomohi01", "nomohi01", "nomohi01", "nomohi01", "nomohi01", "ramirma02", "ramirma02", "ramirma02", "ramirma02", "ramirma02", "ramirma02", "ramirma02", "ramirma02", "ramirma02", "ramirma02", "ramirma02", "ramirma02", "ramirma02", "ramirma02", "ramirma02", "ramirma02", "ramirma02", "ramirma02", "ramirma02", "ramirma02", "ramirma02", "valenjo02", "valenjo02", "valenjo02", "valenjo02", "valenjo02", "valenjo02", "valenjo02", "valenjo02", "valenjo02", "valenjo02", "valenjo02",
+#> "castivi02", "castivi02", "castivi02", "castivi02", "castivi02", "castivi02", "castivi02", "castivi02", "castivi02", "castivi02", "castivi02", "castivi02", "castivi02", "castivi02", "castivi02", "castivi02", "castivi02", "castivi02", "bicheda01", "bicheda01", "bicheda01", "bicheda01", "bicheda01", "bicheda01", "bicheda01", "bicheda01", "bicheda01", "bicheda01", "bicheda01", "bicheda01", "bicheda01", "bicheda01", "bicheda01", "sosasa01", "sosasa01", "sosasa01", "sosasa01", "sosasa01", "sosasa01",
+#> "sosasa01", "sosasa01", "sosasa01", "sosasa01", "sosasa01", "sosasa01", "sosasa01", "sosasa01", "sosasa01", "sosasa01", "sosasa01", "sosasa01", "sosasa01", "thomeji01", "thomeji01", "thomeji01", "thomeji01", "thomeji01", "thomeji01", "thomeji01", "thomeji01", "thomeji01", "thomeji01", "thomeji01", "thomeji01", "thomeji01", "thomeji01", "thomeji01", "thomeji01", "thomeji01", "thomeji01", "thomeji01", "thomeji01", "thomeji01", "thomeji01", "thomeji01", "thomeji01", "thomeji01", "edmonji01", "edmonji01",
+#> "edmonji01", "edmonji01", "edmonji01", "edmonji01", "edmonji01", "edmonji01", "edmonji01", "edmonji01", "edmonji01", "edmonji01", "edmonji01", "edmonji01", "edmonji01", "edmonji01", "edmonji01", "edmonji01", "edmonji01", "mussimi01", "mussimi01", "mussimi01", "mussimi01", "mussimi01", "mussimi01", "mussimi01", "mussimi01", "mussimi01", "mussimi01", "mussimi01", "mussimi01", "mussimi01", "mussimi01", "mussimi01", "mussimi01", "mussimi01", "mussimi01", "schoupe01", "schoupe01", "schoupe01", "schoupe01",
+#> "schoupe01", "schoupe01", "schoupe01", "schoupe01", "schoupe01", "schoupe01", "schoupe01", "schoupe01", "sandere02", "sandere02", "sandere02", "sandere02", "sandere02", "sandere02", "sandere02", "sandere02", "sandere02", "sandere02", "sandere02", "sandere02", "sandere02", "sandere02", "sandere02", "sandere02", "sandere02", "willibe02", "willibe02", "willibe02", "willibe02", "willibe02", "willibe02", "willibe02", "willibe02", "willibe02", "willibe02", "willibe02", "willibe02", "willibe02", "willibe02",
+#> "willibe02", "willibe02", "butlebr01", "butlebr01", "butlebr01", "butlebr01", "butlebr01", "butlebr01", "butlebr01", "butlebr01", "butlebr01", "butlebr01", "butlebr01", "butlebr01", "butlebr01", "butlebr01", "butlebr01", "butlebr01", "butlebr01", "butlebr01", "hentgpa01", "hentgpa01", "hentgpa01", "hentgpa01", "hentgpa01", "hentgpa01", "hentgpa01", "hentgpa01", "hentgpa01", "hentgpa01", "hentgpa01", "hentgpa01", "hentgpa01", "hentgpa01", "buhneja01", "buhneja01", "buhneja01", "buhneja01", "buhneja01",
+#> "buhneja01", "buhneja01", "buhneja01", "buhneja01", "buhneja01", "buhneja01", "buhneja01", "buhneja01", "buhneja01", "buhneja01", "buhneja01", "lopezja01", "lopezja01", "lopezja01", "lopezja01", "lopezja01", "lopezja01", "lopezja01", "lopezja01", "lopezja01", "lopezja01", "lopezja01", "lopezja01", "lopezja01", "lopezja01", "lopezja01", "lopezja01", "wettejo01", "wettejo01", "wettejo01", "wettejo01", "wettejo01", "wettejo01", "wettejo01", "wettejo01", "wettejo01", "wettejo01", "wettejo01", "wettejo01",
+#> "brantje01", "brantje01", "brantje01", "brantje01", "brantje01", "brantje01", "brantje01", "brantje01", "brantje01", "brantje01", "brantje01", "brantje01", "brantje01", "brantje01", "jeterde01", "jeterde01", "jeterde01", "jeterde01", "jeterde01", "jeterde01", "jeterde01", "jeterde01", "jeterde01", "jeterde01", "jeterde01", "jeterde01", "jeterde01", "jeterde01", "jeterde01", "jeterde01", "jeterde01", "jeterde01", "jeterde01", "jeterde01", "hollato01", "hollato01", "hollato01", "hollato01", "hollato01",
+#> "hollato01", "hollato01", "hollato01", "hollato01", "hollato01", "hollato01", "hollato01", "hollato01", "hollato01", "hollato01", "hollato01", "rodrial01", "rodrial01", "rodrial01", "rodrial01", "rodrial01", "rodrial01", "rodrial01", "rodrial01", "rodrial01", "rodrial01", "rodrial01", "rodrial01", "rodrial01", "rodrial01", "rodrial01", "rodrial01", "rodrial01", "rodrial01", "rodrial01", "rodrial01", "rodrial01", "younger01", "younger01", "younger01", "younger01", "younger01", "younger01", "younger01",
+#> "younger01", "younger01", "younger01", "younger01", "younger01", "younger01", "younger01", "younger01", "younger01", "younger01", "younger01", "pettian01", "pettian01", "pettian01", "pettian01", "pettian01", "pettian01", "pettian01", "pettian01", "pettian01", "pettian01", "pettian01", "pettian01", "pettian01", "pettian01", "pettian01", "pettian01", "pettian01", "pettian01", "leiteal01", "leiteal01", "leiteal01", "leiteal01", "leiteal01", "leiteal01", "leiteal01", "leiteal01", "leiteal01", "leiteal01",
+#> "leiteal01", "leiteal01", "leiteal01", "leiteal01", "leiteal01", "leiteal01", "leiteal01", "leiteal01", "leiteal01", "leiteal01", "leiteal01", "hoffmtr01", "hoffmtr01", "hoffmtr01", "hoffmtr01", "hoffmtr01", "hoffmtr01", "hoffmtr01", "hoffmtr01", "hoffmtr01", "hoffmtr01", "hoffmtr01", "hoffmtr01", "hoffmtr01", "hoffmtr01", "hoffmtr01", "hoffmtr01", "hoffmtr01", "hoffmtr01", "hoffmtr01", "martipe02", "martipe02", "martipe02", "martipe02", "martipe02", "martipe02", "martipe02", "martipe02", "martipe02",
+#> "martipe02", "martipe02", "martipe02", "martipe02", "martipe02", "martipe02", "martipe02", "martipe02", "martipe02", "palmera01", "palmera01", "palmera01", "palmera01", "palmera01", "palmera01", "palmera01", "palmera01", "palmera01", "palmera01", "palmera01", "palmera01", "palmera01", "palmera01", "palmera01", "palmera01", "palmera01", "palmera01", "palmera01", "palmera01", "ordonre01", "ordonre01", "ordonre01", "ordonre01", "ordonre01", "ordonre01", "ordonre01", "ordonre01", "ordonre01", "hernali01",
+#> "hernali01", "hernali01", "hernali01", "hernali01", "hernali01", "hernali01", "hernali01", "hernali01", "hernali01", "hernali01", "hernali01", "hernali01", "hernali01", "hernali01", "hernali01", "hernali01", "hernali01", "hernali01", "hernali01", "hernali01", "hernali01", "shawje01", "shawje01", "shawje01", "shawje01", "shawje01", "shawje01", "shawje01", "shawje01", "shawje01", "shawje01", "shawje01", "shawje01", "shawje01", "shawje01", "garcino01", "garcino01", "garcino01", "garcino01", "garcino01",
+#> "garcino01", "garcino01", "garcino01", "garcino01", "garcino01", "garcino01", "garcino01", "garcino01", "garcino01", "garcino01", "rolensc01", "rolensc01", "rolensc01", "rolensc01", "rolensc01", "rolensc01", "rolensc01", "rolensc01", "rolensc01", "rolensc01", "rolensc01", "rolensc01", "rolensc01", "rolensc01", "rolensc01", "rolensc01", "rolensc01", "rolensc01", "rolensc01", "martiti02", "martiti02", "martiti02", "martiti02", "martiti02", "martiti02", "martiti02", "martiti02", "martiti02", "martiti02",
+#> "martiti02", "martiti02", "martiti02", "martiti02", "martiti02", "martiti02", "blausje01", "blausje01", "blausje01", "blausje01", "blausje01", "blausje01", "blausje01", "blausje01", "blausje01", "blausje01", "blausje01", "blausje01", "blausje01", "neaglde01", "neaglde01", "neaglde01", "neaglde01", "neaglde01", "neaglde01", "neaglde01", "neaglde01", "neaglde01", "neaglde01", "neaglde01", "neaglde01", "neaglde01", "neaglde01", "neaglde01", "riverma01", "riverma01", "riverma01", "riverma01", "riverma01",
+#> "riverma01", "riverma01", "riverma01", "riverma01", "riverma01", "riverma01", "riverma01", "riverma01", "riverma01", "riverma01", "riverma01", "riverma01", "riverma01", "riverma01", "wellsda01", "wellsda01", "wellsda01", "wellsda01", "wellsda01", "wellsda01", "wellsda01", "wellsda01", "wellsda01", "wellsda01", "wellsda01", "wellsda01", "wellsda01", "wellsda01", "wellsda01", "wellsda01", "wellsda01", "wellsda01", "wellsda01", "wellsda01", "wellsda01", "wellsda01", "wellsda01", "wellsda01", "brosisc01",
+#> "brosisc01", "brosisc01", "brosisc01", "brosisc01", "brosisc01", "brosisc01", "brosisc01", "brosisc01", "brosisc01", "brosisc01", "boonebr01", "boonebr01", "boonebr01", "boonebr01", "boonebr01", "boonebr01", "boonebr01", "boonebr01", "boonebr01", "boonebr01", "boonebr01", "boonebr01", "boonebr01", "boonebr01", "boonebr01", "jonesan01", "jonesan01", "jonesan01", "jonesan01", "jonesan01", "jonesan01", "jonesan01", "jonesan01", "jonesan01", "jonesan01", "jonesan01", "jonesan01", "jonesan01", "jonesan01",
+#> "jonesan01", "jonesan01", "jonesan01", "hitchst01", "hitchst01", "hitchst01", "hitchst01", "hitchst01", "hitchst01", "hitchst01", "hitchst01", "hitchst01", "hitchst01", "hitchst01", "hitchst01", "hitchst01", "hitchst01", "hitchst01", "gordoto01", "gordoto01", "gordoto01", "gordoto01", "gordoto01", "gordoto01", "gordoto01", "gordoto01", "gordoto01", "gordoto01", "gordoto01", "gordoto01", "gordoto01", "gordoto01", "gordoto01", "gordoto01", "gordoto01", "gordoto01", "gordoto01", "gordoto01", "gordoto01",
+#> "gordoto01", "grievbe01", "grievbe01", "grievbe01", "grievbe01", "grievbe01", "grievbe01", "grievbe01", "grievbe01", "grievbe01", "grievbe01", "woodke02", "woodke02", "woodke02", "woodke02", "woodke02", "woodke02", "woodke02", "woodke02", "woodke02", "woodke02", "woodke02", "woodke02", "woodke02", "woodke02", "woodke02", "easleda01", "easleda01", "easleda01", "easleda01", "easleda01", "easleda01", "easleda01", "easleda01", "easleda01", "easleda01", "easleda01", "easleda01", "easleda01", "easleda01",
+#> "easleda01", "easleda01", "easleda01", "easleda01", "palmede01", "palmede01", "palmede01", "palmede01", "palmede01", "palmede01", "palmede01", "palmede01", "palmede01", "palmede01", "palmede01", "palmede01", "palmede01", "palmede01", "palmede01", "vaughgr01", "vaughgr01", "vaughgr01", "vaughgr01", "vaughgr01", "vaughgr01", "vaughgr01", "vaughgr01", "vaughgr01", "vaughgr01", "vaughgr01", "vaughgr01", "vaughgr01", "vaughgr01", "vaughgr01", "vaughgr01", "brownke01", "brownke01", "brownke01", "brownke01",
+#> "brownke01", "brownke01", "brownke01", "brownke01", "brownke01", "brownke01", "brownke01", "brownke01", "brownke01", "brownke01", "brownke01", "brownke01", "brownke01", "brownke01", "brownke01", "hernaor01", "hernaor01", "hernaor01", "hernaor01", "hernaor01", "hernaor01", "hernaor01", "hernaor01", "hernaor01", "hernaor01", "greensh01", "greensh01", "greensh01", "greensh01", "greensh01", "greensh01", "greensh01", "greensh01", "greensh01", "greensh01", "greensh01", "greensh01", "greensh01", "greensh01",
+#> "greensh01", "greensh01", "reesepo01", "reesepo01", "reesepo01", "reesepo01", "reesepo01", "reesepo01", "reesepo01", "reesepo01", "liebemi01", "liebemi01", "liebemi01", "liebemi01", "liebemi01", "liebemi01", "liebemi01", "liebemi01", "liebemi01", "liebemi01", "liebemi01", "liebemi01", "liebemi01", "liebemi01", "caseyse01", "caseyse01", "caseyse01", "caseyse01", "caseyse01", "caseyse01", "caseyse01", "caseyse01", "caseyse01", "caseyse01", "caseyse01", "caseyse01", "caseyse01", "jonesch06", "jonesch06",
+#> "jonesch06", "jonesch06", "jonesch06", "jonesch06", "jonesch06", "jonesch06", "jonesch06", "jonesch06", "jonesch06", "jonesch06", "jonesch06", "jonesch06", "jonesch06", "jonesch06", "jonesch06", "jonesch06", "jonesch06", "perezed02", "perezed02", "perezed02", "perezed02", "perezed02", "perezed02", "perezed02", "perezed02", "perezed02", "perezed02", "perezed02", "wagnebi02", "wagnebi02", "wagnebi02", "wagnebi02", "wagnebi02", "wagnebi02", "wagnebi02", "wagnebi02", "wagnebi02", "wagnebi02", "wagnebi02",
+#> "wagnebi02", "wagnebi02", "wagnebi02", "wagnebi02", "wagnebi02", "wagnebi02", "beltrca01", "beltrca01", "beltrca01", "beltrca01", "beltrca01", "beltrca01", "beltrca01", "beltrca01", "beltrca01", "beltrca01", "beltrca01", "beltrca01", "beltrca01", "beltrca01", "beltrca01", "beltrca01", "beltrca01", "beltrca01", "beltrca01", "beltrca01", "willisc01", "willisc01", "willisc01", "willisc01", "willisc01", "willisc01", "willisc01", "willisc01", "willisc01", "willisc01", "willisc01", "delgaca01", "delgaca01",
+#> "delgaca01", "delgaca01", "delgaca01", "delgaca01", "delgaca01", "delgaca01", "delgaca01", "delgaca01", "delgaca01", "delgaca01", "delgaca01", "delgaca01", "delgaca01", "delgaca01", "delgaca01", "alfoned01", "alfoned01", "alfoned01", "alfoned01", "alfoned01", "alfoned01", "alfoned01", "alfoned01", "alfoned01", "alfoned01", "alfoned01", "alfoned01", "alfoned01", "guerrvl01", "guerrvl01", "guerrvl01", "guerrvl01", "guerrvl01", "guerrvl01", "guerrvl01", "guerrvl01", "guerrvl01", "guerrvl01", "guerrvl01",
+#> "guerrvl01", "guerrvl01", "guerrvl01", "guerrvl01", "guerrvl01", "hamptmi01", "hamptmi01", "hamptmi01", "hamptmi01", "hamptmi01", "hamptmi01", "hamptmi01", "hamptmi01", "hamptmi01", "hamptmi01", "hamptmi01", "hamptmi01", "hamptmi01", "hamptmi01", "hamptmi01", "hamptmi01", "moyerja01", "moyerja01", "moyerja01", "moyerja01", "moyerja01", "moyerja01", "moyerja01", "moyerja01", "moyerja01", "moyerja01", "moyerja01", "moyerja01", "moyerja01", "moyerja01", "moyerja01", "moyerja01", "moyerja01", "moyerja01",
+#> "moyerja01", "moyerja01", "moyerja01", "moyerja01", "moyerja01", "moyerja01", "moyerja01", "moyerja01", "moyerja01", "limajo01", "limajo01", "limajo01", "limajo01", "limajo01", "limajo01", "limajo01", "limajo01", "limajo01", "limajo01", "limajo01", "limajo01", "limajo01", "limajo01", "urbinug01", "urbinug01", "urbinug01", "urbinug01", "urbinug01", "urbinug01", "urbinug01", "urbinug01", "urbinug01", "urbinug01", "urbinug01", "urbinug01", "urbinug01", "urbinug01", "stottto01", "stottto01", "stottto01",
+#> "stottto01", "stottto01", "stottto01", "stottto01", "stottto01", "stottto01", "stottto01", "stottto01", "stottto01", "stottto01", "stottto01", "stottto01", "dyeje01", "dyeje01", "dyeje01", "dyeje01", "dyeje01", "dyeje01", "dyeje01", "dyeje01", "dyeje01", "dyeje01", "dyeje01", "dyeje01", "dyeje01", "dyeje01", "dyeje01", "erstada01", "erstada01", "erstada01", "erstada01", "erstada01", "erstada01", "erstada01", "erstada01", "erstada01", "erstada01", "erstada01", "erstada01", "erstada01", "erstada01",
+#> "rogerke01", "rogerke01", "rogerke01", "rogerke01", "rogerke01", "rogerke01", "rogerke01", "rogerke01", "rogerke01", "rogerke01", "rogerke01", "rogerke01", "rogerke01", "rogerke01", "rogerke01", "rogerke01", "rogerke01", "rogerke01", "rogerke01", "rogerke01", "rogerke01", "mathemi01", "mathemi01", "mathemi01", "mathemi01", "mathemi01", "mathemi01", "mathemi01", "mathemi01", "mathemi01", "mathemi01", "mathemi01", "mathemi01", "mathemi01", "perezne01", "perezne01", "perezne01", "perezne01", "perezne01",
+#> "perezne01", "perezne01", "perezne01", "perezne01", "perezne01", "perezne01", "perezne01", "perezne01", "perezne01", "perezne01", "heltoto01", "heltoto01", "heltoto01", "heltoto01", "heltoto01", "heltoto01", "heltoto01", "heltoto01", "heltoto01", "heltoto01", "heltoto01", "heltoto01", "heltoto01", "heltoto01", "heltoto01", "heltoto01", "heltoto01", "giambja01", "giambja01", "giambja01", "giambja01", "giambja01", "giambja01", "giambja01", "giambja01", "giambja01", "giambja01", "giambja01", "giambja01",
+#> "giambja01", "giambja01", "giambja01", "giambja01", "giambja01", "giambja01", "giambja01", "giambja01", "giambja01", "kentje01", "kentje01", "kentje01", "kentje01", "kentje01", "kentje01", "kentje01", "kentje01", "kentje01", "kentje01", "kentje01", "kentje01", "kentje01", "kentje01", "kentje01", "kentje01", "kentje01", "kentje01", "kentje01", "jonesto02", "jonesto02", "jonesto02", "jonesto02", "jonesto02", "jonesto02", "jonesto02", "jonesto02", "jonesto02", "jonesto02", "jonesto02", "jonesto02",
+#> "jonesto02", "jonesto02", "jonesto02", "jonesto02", "jonesto02", "jonesto02", "jonesto02", "alfonan01", "alfonan01", "alfonan01", "alfonan01", "alfonan01", "alfonan01", "alfonan01", "alfonan01", "alfonan01", "alfonan01", "alfonan01", "sasakka01", "sasakka01", "sasakka01", "sasakka01", "furcara01", "furcara01", "furcara01", "furcara01", "furcara01", "furcara01", "furcara01", "furcara01", "furcara01", "furcara01", "furcara01", "furcara01", "furcara01", "furcara01", "furcara01", "glaustr01", "glaustr01",
+#> "glaustr01", "glaustr01", "glaustr01", "glaustr01", "glaustr01", "glaustr01", "glaustr01", "glaustr01", "glaustr01", "glaustr01", "glaustr01", "posadjo01", "posadjo01", "posadjo01", "posadjo01", "posadjo01", "posadjo01", "posadjo01", "posadjo01", "posadjo01", "posadjo01", "posadjo01", "posadjo01", "posadjo01", "posadjo01", "posadjo01", "posadjo01", "posadjo01", "ordonma01", "ordonma01", "ordonma01", "ordonma01", "ordonma01", "ordonma01", "ordonma01", "ordonma01", "ordonma01", "ordonma01", "ordonma01",
+#> "ordonma01", "ordonma01", "ordonma01", "ordonma01", "renteed01", "renteed01", "renteed01", "renteed01", "renteed01", "renteed01", "renteed01", "renteed01", "renteed01", "renteed01", "renteed01", "renteed01", "renteed01", "renteed01", "renteed01", "renteed01", "mientdo01", "mientdo01", "mientdo01", "mientdo01", "mientdo01", "mientdo01", "mientdo01", "mientdo01", "mientdo01", "mientdo01", "mientdo01", "mientdo01", "mientdo01", "chaveer01", "chaveer01", "chaveer01", "chaveer01", "chaveer01", "chaveer01",
+#> "chaveer01", "chaveer01", "chaveer01", "chaveer01", "chaveer01", "chaveer01", "chaveer01", "chaveer01", "chaveer01", "chaveer01", "chaveer01", "camermi01", "camermi01", "camermi01", "camermi01", "camermi01", "camermi01", "camermi01", "camermi01", "camermi01", "camermi01", "camermi01", "camermi01", "camermi01", "camermi01", "camermi01", "camermi01", "camermi01", "camermi01", "hunteto01", "hunteto01", "hunteto01", "hunteto01", "hunteto01", "hunteto01", "hunteto01", "hunteto01", "hunteto01", "hunteto01",
+#> "hunteto01", "hunteto01", "hunteto01", "hunteto01", "hunteto01", "hunteto01", "hunteto01", "hunteto01", "hunteto01", "suzukic01", "suzukic01", "suzukic01", "suzukic01", "suzukic01", "suzukic01", "suzukic01", "suzukic01", "suzukic01", "suzukic01", "suzukic01", "suzukic01", "suzukic01", "suzukic01", "suzukic01", "suzukic01", "vinafe01", "vinafe01", "vinafe01", "vinafe01", "vinafe01", "vinafe01", "vinafe01", "vinafe01", "vinafe01", "vinafe01", "vinafe01", "vinafe01", "ausmubr01", "ausmubr01", "ausmubr01",
+#> "ausmubr01", "ausmubr01", "ausmubr01", "ausmubr01", "ausmubr01", "ausmubr01", "ausmubr01", "ausmubr01", "ausmubr01", "ausmubr01", "ausmubr01", "ausmubr01", "ausmubr01", "ausmubr01", "ausmubr01", "ausmubr01", "cabreor01", "cabreor01", "cabreor01", "cabreor01", "cabreor01", "cabreor01", "cabreor01", "cabreor01", "cabreor01", "cabreor01", "cabreor01", "cabreor01", "cabreor01", "cabreor01", "cabreor01", "cabreor01", "cabreor01", "cabreor01", "counscr01", "counscr01", "counscr01", "counscr01", "counscr01",
+#> "counscr01", "counscr01", "counscr01", "counscr01", "counscr01", "counscr01", "counscr01", "counscr01", "counscr01", "counscr01", "counscr01", "counscr01", "counscr01", "benitar01", "benitar01", "benitar01", "benitar01", "benitar01", "benitar01", "benitar01", "benitar01", "benitar01", "benitar01", "benitar01", "benitar01", "benitar01", "benitar01", "benitar01", "benitar01", "benitar01", "benitar01", "pujolal01", "pujolal01", "pujolal01", "pujolal01", "pujolal01", "pujolal01", "pujolal01", "pujolal01",
+#> "pujolal01", "pujolal01", "pujolal01", "pujolal01", "pujolal01", "pujolal01", "pujolal01", "gonzalu01", "gonzalu01", "gonzalu01", "gonzalu01", "gonzalu01", "gonzalu01", "gonzalu01", "gonzalu01", "gonzalu01", "gonzalu01", "gonzalu01", "gonzalu01", "gonzalu01", "gonzalu01", "gonzalu01", "gonzalu01", "gonzalu01", "gonzalu01", "gonzalu01", "gonzalu01", "aurilri01", "aurilri01", "aurilri01", "aurilri01", "aurilri01", "aurilri01", "aurilri01", "aurilri01", "aurilri01", "aurilri01", "aurilri01", "aurilri01",
+#> "aurilri01", "aurilri01", "aurilri01", "aurilri01", "muldema01", "muldema01", "muldema01", "muldema01", "muldema01", "muldema01", "muldema01", "muldema01", "muldema01", "nenro01", "nenro01", "nenro01", "nenro01", "nenro01", "nenro01", "nenro01", "nenro01", "nenro01", "nenro01", "nenro01", "kennead01", "kennead01", "kennead01", "kennead01", "kennead01", "kennead01", "kennead01", "kennead01", "kennead01", "kennead01", "kennead01", "kennead01", "kennead01", "kennead01", "valenbo02", "valenbo02", "valenbo02",
+#> "valenbo02", "valenbo02", "valenbo02", "valenbo02", "valenbo02", "valenbo02", "valenbo02", "valenbo02", "valenbo02", "zitoba01", "zitoba01", "zitoba01", "zitoba01", "zitoba01", "zitoba01", "zitoba01", "zitoba01", "zitoba01", "zitoba01", "zitoba01", "zitoba01", "zitoba01", "zitoba01", "zitoba01", "molinbe01", "molinbe01", "molinbe01", "molinbe01", "molinbe01", "molinbe01", "molinbe01", "molinbe01", "molinbe01", "molinbe01", "molinbe01", "molinbe01", "molinbe01", "molinbe01", "graveda01", "graveda01",
+#> "graveda01", "graveda01", "graveda01", "graveda01", "graveda01", "graveda01", "graveda01", "graveda01", "graveda01", "graveda01", "graveda01", "tejadmi01", "tejadmi01", "tejadmi01", "tejadmi01", "tejadmi01", "tejadmi01", "tejadmi01", "tejadmi01", "tejadmi01", "tejadmi01", "tejadmi01", "tejadmi01", "tejadmi01", "tejadmi01", "tejadmi01", "tejadmi01", "tejadmi01", "kochbi01", "kochbi01", "kochbi01", "kochbi01", "kochbi01", "kochbi01", "kochbi01", "hinsker01", "hinsker01", "hinsker01", "hinsker01", "hinsker01",
+#> "hinsker01", "hinsker01", "hinsker01", "hinsker01", "hinsker01", "hinsker01", "hinsker01", "hinsker01", "hinsker01", "jennija01", "jennija01", "jennija01", "jennija01", "jennija01", "jennija01", "jennija01", "jennija01", "jennija01", "soriaal01", "soriaal01", "soriaal01", "soriaal01", "soriaal01", "soriaal01", "soriaal01", "soriaal01", "soriaal01", "soriaal01", "soriaal01", "soriaal01", "soriaal01", "soriaal01", "soriaal01", "soriaal01", "soriaal01", "anderga01", "anderga01", "anderga01", "anderga01",
+#> "anderga01", "anderga01", "anderga01", "anderga01", "anderga01", "anderga01", "anderga01", "anderga01", "anderga01", "anderga01", "anderga01", "anderga01", "anderga01", "lowede01", "lowede01", "lowede01", "lowede01", "lowede01", "lowede01", "lowede01", "lowede01", "lowede01", "lowede01", "lowede01", "lowede01", "lowede01", "lowede01", "lowede01", "lowede01", "lowede01", "lowede01", "lowede01", "beckejo02", "beckejo02", "beckejo02", "beckejo02", "beckejo02", "beckejo02", "beckejo02", "beckejo02",
+#> "beckejo02", "beckejo02", "beckejo02", "beckejo02", "beckejo02", "beckejo02", "beckejo02", "hallaro01", "hallaro01", "hallaro01", "hallaro01", "hallaro01", "hallaro01", "hallaro01", "hallaro01", "hallaro01", "hallaro01", "hallaro01", "hallaro01", "hallaro01", "hallaro01", "hallaro01", "hallaro01", "gagneer01", "gagneer01", "gagneer01", "gagneer01", "gagneer01", "gagneer01", "gagneer01", "gagneer01", "gagneer01", "gagneer01", "gagneer01", "leede02", "leede02", "leede02", "leede02", "leede02", "leede02",
+#> "leede02", "leede02", "leede02", "leede02", "leede02", "leede02", "leede02", "leede02", "leede02", "leede02", "leede02", "castilu01", "castilu01", "castilu01", "castilu01", "castilu01", "castilu01", "castilu01", "castilu01", "castilu01", "castilu01", "castilu01", "castilu01", "castilu01", "castilu01", "castilu01", "castilu01", "cruzjo02", "cruzjo02", "cruzjo02", "cruzjo02", "cruzjo02", "cruzjo02", "cruzjo02", "cruzjo02", "cruzjo02", "cruzjo02", "cruzjo02", "cruzjo02", "cruzjo02", "cruzjo02", "cruzjo02",
+#> "foulkke01", "foulkke01", "foulkke01", "foulkke01", "foulkke01", "foulkke01", "foulkke01", "foulkke01", "foulkke01", "foulkke01", "foulkke01", "foulkke01", "berroan01", "berroan01", "berroan01", "berroan01", "berroan01", "berroan01", "berroan01", "berroan01", "berroan01", "berroan01", "willido03", "willido03", "willido03", "willido03", "willido03", "willido03", "willido03", "willido03", "willido03", "willido03", "muellbi02", "muellbi02", "muellbi02", "muellbi02", "muellbi02", "muellbi02", "muellbi02",
+#> "muellbi02", "muellbi02", "muellbi02", "muellbi02", "muellbi02", "wellsve01", "wellsve01", "wellsve01", "wellsve01", "wellsve01", "wellsve01", "wellsve01", "wellsve01", "wellsve01", "wellsve01", "wellsve01", "wellsve01", "wellsve01", "wellsve01", "wellsve01", "vidrojo01", "vidrojo01", "vidrojo01", "vidrojo01", "vidrojo01", "vidrojo01", "vidrojo01", "vidrojo01", "vidrojo01", "vidrojo01", "vidrojo01", "vidrojo01", "lowelmi01", "lowelmi01", "lowelmi01", "lowelmi01", "lowelmi01", "lowelmi01", "lowelmi01",
+#> "lowelmi01", "lowelmi01", "lowelmi01", "lowelmi01", "lowelmi01", "lowelmi01", "gilesma01", "gilesma01", "gilesma01", "gilesma01", "gilesma01", "gilesma01", "gilesma01", "wolfra02", "wolfra02", "wolfra02", "wolfra02", "wolfra02", "wolfra02", "wolfra02", "wolfra02", "wolfra02", "wolfra02", "wolfra02", "wolfra02", "wolfra02", "wolfra02", "wolfra02", "wolfra02", "wolfra02", "wolfra02", "ortizda01", "ortizda01", "ortizda01", "ortizda01", "ortizda01", "ortizda01", "ortizda01", "ortizda01", "ortizda01",
+#> "ortizda01", "ortizda01", "ortizda01", "ortizda01", "ortizda01", "ortizda01", "ortizda01", "ortizda01", "ortizda01", "ortizda01", "santajo01", "santajo01", "santajo01", "santajo01", "santajo01", "santajo01", "santajo01", "santajo01", "santajo01", "santajo01", "santajo01", "santajo01", "izturce01", "izturce01", "izturce01", "izturce01", "izturce01", "izturce01", "izturce01", "izturce01", "izturce01", "izturce01", "izturce01", "izturce01", "izturce01", "izturce01", "izturce01", "izturce01", "crosbbo01",
+#> "crosbbo01", "crosbbo01", "crosbbo01", "crosbbo01", "crosbbo01", "crosbbo01", "crosbbo01", "crosbbo01", "bayja01", "bayja01", "bayja01", "bayja01", "bayja01", "bayja01", "bayja01", "bayja01", "bayja01", "bayja01", "bayja01", "bayja01", "bayja01", "teixema01", "teixema01", "teixema01", "teixema01", "teixema01", "teixema01", "teixema01", "teixema01", "teixema01", "teixema01", "teixema01", "teixema01", "teixema01", "teixema01", "teixema01", "morame01", "morame01", "morame01", "morame01", "morame01",
+#> "morame01", "morame01", "morame01", "morame01", "morame01", "morame01", "morame01", "morame01", "morame01", "martivi01", "martivi01", "martivi01", "martivi01", "martivi01", "martivi01", "martivi01", "martivi01", "martivi01", "martivi01", "martivi01", "martivi01", "martivi01", "martivi01", "loretma01", "loretma01", "loretma01", "loretma01", "loretma01", "loretma01", "loretma01", "loretma01", "loretma01", "loretma01", "loretma01", "loretma01", "loretma01", "loretma01", "loretma01", "loretma01", "beltrad01",
+#> "beltrad01", "beltrad01", "beltrad01", "beltrad01", "beltrad01", "beltrad01", "beltrad01", "beltrad01", "beltrad01", "beltrad01", "beltrad01", "beltrad01", "beltrad01", "beltrad01", "beltrad01", "beltrad01", "beltrad01", "estrajo01", "estrajo01", "estrajo01", "estrajo01", "estrajo01", "estrajo01", "estrajo01", "estrajo01", "abreubo01", "abreubo01", "abreubo01", "abreubo01", "abreubo01", "abreubo01", "abreubo01", "abreubo01", "abreubo01", "abreubo01", "abreubo01", "abreubo01", "abreubo01", "abreubo01",
+#> "abreubo01", "abreubo01", "abreubo01", "abreubo01", "abreubo01", "abreubo01", "wilsoja02", "wilsoja02", "wilsoja02", "wilsoja02", "wilsoja02", "wilsoja02", "wilsoja02", "wilsoja02", "wilsoja02", "wilsoja02", "wilsoja02", "wilsoja02", "wilsoja02", "wilsoja02", "konerpa01", "konerpa01", "konerpa01", "konerpa01", "konerpa01", "konerpa01", "konerpa01", "konerpa01", "konerpa01", "konerpa01", "konerpa01", "konerpa01", "konerpa01", "konerpa01", "konerpa01", "konerpa01", "konerpa01", "konerpa01", "konerpa01",
+#> "drewjd01", "drewjd01", "drewjd01", "drewjd01", "drewjd01", "drewjd01", "drewjd01", "drewjd01", "drewjd01", "drewjd01", "drewjd01", "drewjd01", "drewjd01", "drewjd01", "schmija01", "schmija01", "schmija01", "schmija01", "schmija01", "schmija01", "schmija01", "schmija01", "schmija01", "schmija01", "schmija01", "schmija01", "schmija01", "schmija01", "schmija01", "schmija01", "nathajo01", "nathajo01", "nathajo01", "nathajo01", "nathajo01", "nathajo01", "nathajo01", "nathajo01", "nathajo01", "nathajo01",
+#> "nathajo01", "nathajo01", "nathajo01", "nathajo01", "nathajo01", "colonba01", "colonba01", "colonba01", "colonba01", "colonba01", "colonba01", "colonba01", "colonba01", "colonba01", "colonba01", "colonba01", "colonba01", "colonba01", "colonba01", "colonba01", "colonba01", "colonba01", "colonba01", "colonba01", "carpech01", "carpech01", "carpech01", "carpech01", "carpech01", "carpech01", "carpech01", "carpech01", "carpech01", "carpech01", "carpech01", "carpech01", "carpech01", "carpech01", "carpech01",
+#> "hudsoor01", "hudsoor01", "hudsoor01", "hudsoor01", "hudsoor01", "hudsoor01", "hudsoor01", "hudsoor01", "hudsoor01", "hudsoor01", "hudsoor01", "hudsoor01", "varitja01", "varitja01", "varitja01", "varitja01", "varitja01", "varitja01", "varitja01", "varitja01", "varitja01", "varitja01", "varitja01", "varitja01", "varitja01", "varitja01", "varitja01", "oswalro01", "oswalro01", "oswalro01", "oswalro01", "oswalro01", "oswalro01", "oswalro01", "oswalro01", "oswalro01", "oswalro01", "oswalro01", "oswalro01",
+#> "oswalro01", "oswalro01", "cordech01", "cordech01", "cordech01", "cordech01", "cordech01", "cordech01", "cordech01", "streehu01", "streehu01", "streehu01", "streehu01", "streehu01", "streehu01", "streehu01", "streehu01", "streehu01", "streehu01", "streehu01", "streehu01", "howarry01", "howarry01", "howarry01", "howarry01", "howarry01", "howarry01", "howarry01", "howarry01", "howarry01", "howarry01", "howarry01", "howarry01", "ensbemo01", "ensbemo01", "ensbemo01", "ensbemo01", "ensbemo01", "ensbemo01",
+#> "ensbemo01", "ensbemo01", "ensbemo01", "barremi01", "barremi01", "barremi01", "barremi01", "barremi01", "barremi01", "barremi01", "barremi01", "barremi01", "barremi01", "barremi01", "barremi01", "barremi01", "cabremi01", "cabremi01", "cabremi01", "cabremi01", "cabremi01", "cabremi01", "cabremi01", "cabremi01", "cabremi01", "cabremi01", "cabremi01", "cabremi01", "cabremi01", "leeca01", "leeca01", "leeca01", "leeca01", "leeca01", "leeca01", "leeca01", "leeca01", "leeca01", "leeca01", "leeca01", "leeca01",
+#> "leeca01", "leeca01", "leeca01", "leeca01", "marquja01", "marquja01", "marquja01", "marquja01", "marquja01", "marquja01", "marquja01", "marquja01", "marquja01", "marquja01", "marquja01", "marquja01", "marquja01", "marquja01", "marquja01", "marquja01", "marquja01", "lopezfe01", "lopezfe01", "lopezfe01", "lopezfe01", "lopezfe01", "lopezfe01", "lopezfe01", "lopezfe01", "lopezfe01", "lopezfe01", "lopezfe01", "lopezfe01", "lopezfe01", "lopezfe01", "lopezfe01", "lopezfe01", "roberbr01", "roberbr01", "roberbr01",
+#> "roberbr01", "roberbr01", "roberbr01", "roberbr01", "roberbr01", "roberbr01", "roberbr01", "roberbr01", "roberbr01", "roberbr01", "roberbr01", "damonjo01", "damonjo01", "damonjo01", "damonjo01", "damonjo01", "damonjo01", "damonjo01", "damonjo01", "damonjo01", "damonjo01", "damonjo01", "damonjo01", "damonjo01", "damonjo01", "damonjo01", "damonjo01", "damonjo01", "damonjo01", "youngmi02", "youngmi02", "youngmi02", "youngmi02", "youngmi02", "youngmi02", "youngmi02", "youngmi02", "youngmi02", "youngmi02",
+#> "youngmi02", "youngmi02", "youngmi02", "youngmi02", "youngmi02", "loducpa01", "loducpa01", "loducpa01", "loducpa01", "loducpa01", "loducpa01", "loducpa01", "loducpa01", "loducpa01", "loducpa01", "loducpa01", "loducpa01", "loducpa01", "polanpl01", "polanpl01", "polanpl01", "polanpl01", "polanpl01", "polanpl01", "polanpl01", "polanpl01", "polanpl01", "polanpl01", "polanpl01", "polanpl01", "polanpl01", "polanpl01", "polanpl01", "polanpl01", "polanpl01", "polanpl01", "eckstda01", "eckstda01", "eckstda01",
+#> "eckstda01", "eckstda01", "eckstda01", "eckstda01", "eckstda01", "eckstda01", "eckstda01", "eckstda01", "lasorto01", "lasorto01", "lasorto01", "johnsji04", "johnsji04", "johnsji04", "johnsji04", "johnsji04", "johnsji04", "johnsji04", "johnsji04", "johnsji04", "johnsji04", "johnsji04", "johnsji04", "webbbr01", "webbbr01", "webbbr01", "webbbr01", "webbbr01", "webbbr01", "webbbr01", "grudzma01", "grudzma01", "grudzma01", "grudzma01", "grudzma01", "grudzma01", "grudzma01", "grudzma01", "grudzma01", "grudzma01",
+#> "grudzma01", "grudzma01", "grudzma01", "grudzma01", "grudzma01", "grudzma01", "morneju01", "morneju01", "morneju01", "morneju01", "morneju01", "morneju01", "morneju01", "morneju01", "morneju01", "morneju01", "morneju01", "morneju01", "morneju01", "morneju01", "suppaje01", "suppaje01", "suppaje01", "suppaje01", "suppaje01", "suppaje01", "suppaje01", "suppaje01", "suppaje01", "suppaje01", "suppaje01", "suppaje01", "suppaje01", "suppaje01", "suppaje01", "suppaje01", "suppaje01", "suppaje01", "suppaje01",
+#> "suppaje01", "rodrifr03", "rodrifr03", "rodrifr03", "rodrifr03", "rodrifr03", "rodrifr03", "rodrifr03", "rodrifr03", "rodrifr03", "rodrifr03", "rodrifr03", "rodrifr03", "rodrifr03", "rodrifr03", "rodrifr03", "rodrifr03", "verlaju01", "verlaju01", "verlaju01", "verlaju01", "verlaju01", "verlaju01", "verlaju01", "verlaju01", "verlaju01", "verlaju01", "verlaju01", "ramirha01", "ramirha01", "ramirha01", "ramirha01", "ramirha01", "ramirha01", "ramirha01", "ramirha01", "ramirha01", "ramirha01", "ramirha01",
+#> "ramirha01", "canoro01", "canoro01", "canoro01", "canoro01", "canoro01", "canoro01", "canoro01", "canoro01", "canoro01", "canoro01", "canoro01", "credejo01", "credejo01", "credejo01", "credejo01", "credejo01", "credejo01", "credejo01", "credejo01", "credejo01", "credejo01", "mauerjo01", "mauerjo01", "mauerjo01", "mauerjo01", "mauerjo01", "mauerjo01", "mauerjo01", "mauerjo01", "mauerjo01", "mauerjo01", "mauerjo01", "mauerjo01", "utleych01", "utleych01", "utleych01", "utleych01", "utleych01", "utleych01",
+#> "utleych01", "utleych01", "utleych01", "utleych01", "utleych01", "utleych01", "utleych01", "utleych01", "mccanbr01", "mccanbr01", "mccanbr01", "mccanbr01", "mccanbr01", "mccanbr01", "mccanbr01", "mccanbr01", "mccanbr01", "mccanbr01", "mccanbr01", "hollima01", "hollima01", "hollima01", "hollima01", "hollima01", "hollima01", "hollima01", "hollima01", "hollima01", "hollima01", "hollima01", "hollima01", "hollima01", "zambrca01", "zambrca01", "zambrca01", "zambrca01", "zambrca01", "zambrca01", "zambrca01",
+#> "zambrca01", "zambrca01", "zambrca01", "zambrca01", "zambrca01", "reyesjo01", "reyesjo01", "reyesjo01", "reyesjo01", "reyesjo01", "reyesjo01", "reyesjo01", "reyesjo01", "reyesjo01", "reyesjo01", "reyesjo01", "reyesjo01", "reyesjo01", "reyesjo01", "wrighda03", "wrighda03", "wrighda03", "wrighda03", "wrighda03", "wrighda03", "wrighda03", "wrighda03", "wrighda03", "wrighda03", "wrighda03", "wrighda03", "berkmla01", "berkmla01", "berkmla01", "berkmla01", "berkmla01", "berkmla01", "berkmla01", "berkmla01",
+#> "berkmla01", "berkmla01", "berkmla01", "berkmla01", "berkmla01", "berkmla01", "berkmla01", "berkmla01", "papeljo01", "papeljo01", "papeljo01", "papeljo01", "papeljo01", "papeljo01", "papeljo01", "papeljo01", "papeljo01", "papeljo01", "papeljo01", "papeljo01", "penaca01", "penaca01", "penaca01", "penaca01", "penaca01", "penaca01", "penaca01", "penaca01", "penaca01", "penaca01", "penaca01", "penaca01", "penaca01", "penaca01", "penaca01", "penaca01", "youngdm01", "youngdm01", "youngdm01", "youngdm01",
+#> "youngdm01", "youngdm01", "youngdm01", "youngdm01", "youngdm01", "youngdm01", "youngdm01", "youngdm01", "youngdm01", "sabatcc01", "sabatcc01", "sabatcc01", "sabatcc01", "sabatcc01", "sabatcc01", "sabatcc01", "sabatcc01", "sabatcc01", "sabatcc01", "sabatcc01", "sabatcc01", "sabatcc01", "sabatcc01", "sabatcc01", "sabatcc01", "peavyja01", "peavyja01", "peavyja01", "peavyja01", "peavyja01", "peavyja01", "peavyja01", "peavyja01", "peavyja01", "peavyja01", "peavyja01", "peavyja01", "peavyja01", "peavyja01",
+#> "peavyja01", "peavyja01", "peavyja01", "youklke01", "youklke01", "youklke01", "youklke01", "youklke01", "youklke01", "youklke01", "youklke01", "youklke01", "youklke01", "youklke01", "sizemgr01", "sizemgr01", "sizemgr01", "sizemgr01", "sizemgr01", "sizemgr01", "sizemgr01", "sizemgr01", "sizemgr01", "sizemgr01", "sizemgr01", "sizemgr01", "martiru01", "martiru01", "martiru01", "martiru01", "martiru01", "martiru01", "martiru01", "martiru01", "martiru01", "martiru01", "francje02", "francje02", "francje02",
+#> "francje02", "francje02", "francje02", "francje02", "francje02", "francje02", "francje02", "francje02", "francje02", "francje02", "francje02", "rowanaa01", "rowanaa01", "rowanaa01", "rowanaa01", "rowanaa01", "rowanaa01", "rowanaa01", "rowanaa01", "rowanaa01", "rowanaa01", "rowanaa01", "rolliji01", "rolliji01", "rolliji01", "rolliji01", "rolliji01", "rolliji01", "rolliji01", "rolliji01", "rolliji01", "rolliji01", "rolliji01", "rolliji01", "rolliji01", "rolliji01", "rolliji01", "rolliji01", "fieldpr01",
+#> "fieldpr01", "fieldpr01", "fieldpr01", "fieldpr01", "fieldpr01", "fieldpr01", "fieldpr01", "fieldpr01", "fieldpr01", "fieldpr01", "sweenmi01", "sweenmi01", "sweenmi01", "sweenmi01", "sweenmi01", "sweenmi01", "sweenmi01", "sweenmi01", "sweenmi01", "sweenmi01", "sweenmi01", "sweenmi01", "sweenmi01", "sweenmi01", "sweenmi01", "sweenmi01", "sweenmi01", "timlimi01", "timlimi01", "timlimi01", "timlimi01", "timlimi01", "timlimi01", "timlimi01", "timlimi01", "timlimi01", "timlimi01", "timlimi01", "timlimi01",
+#> "timlimi01", "timlimi01", "timlimi01", "timlimi01", "timlimi01", "timlimi01", "timlimi01", "timlimi01", "timlimi01", "putzjj01", "putzjj01", "putzjj01", "putzjj01", "putzjj01", "putzjj01", "putzjj01", "putzjj01", "putzjj01", "putzjj01", "putzjj01", "putzjj01", "valvejo01", "valvejo01", "valvejo01", "valvejo01", "valvejo01", "valvejo01", "valvejo01", "valvejo01", "valvejo01", "valvejo01", "valvejo01", "valvejo01", "pedrodu01", "pedrodu01", "pedrodu01", "pedrodu01", "pedrodu01", "pedrodu01", "pedrodu01",
+#> "pedrodu01", "pedrodu01", "pedrodu01", "braunry02", "braunry02", "braunry02", "braunry02", "braunry02", "braunry02", "braunry02", "braunry02", "braunry02", "owingmi01", "owingmi01", "owingmi01", "owingmi01", "owingmi01", "owingmi01", "owingmi01", "borowjo01", "borowjo01", "borowjo01", "borowjo01", "borowjo01", "borowjo01", "borowjo01", "borowjo01", "borowjo01", "borowjo01", "borowjo01", "borowjo01", "borowjo01", "borowjo01", "garzama01", "garzama01", "garzama01", "garzama01", "garzama01", "garzama01",
+#> "garzama01", "garzama01", "garzama01", "garzama01", "garzama01", "hamelco01", "hamelco01", "hamelco01", "hamelco01", "hamelco01", "hamelco01", "hamelco01", "hamelco01", "hamelco01", "hamelco01", "hamelco01", "leecl02", "leecl02", "leecl02", "leecl02", "leecl02", "leecl02", "leecl02", "leecl02", "leecl02", "leecl02", "leecl02", "leecl02", "leecl02", "leecl02", "leecl02", "lidgebr01", "lidgebr01", "lidgebr01", "lidgebr01", "lidgebr01", "lidgebr01", "lidgebr01", "lidgebr01", "lidgebr01", "lidgebr01",
+#> "lidgebr01", "linceti01", "linceti01", "linceti01", "linceti01", "linceti01", "linceti01", "linceti01", "linceti01", "linceti01", "gonzaad01", "gonzaad01", "gonzaad01", "gonzaad01", "gonzaad01", "gonzaad01", "gonzaad01", "gonzaad01", "gonzaad01", "gonzaad01", "gonzaad01", "gonzaad01", "gonzaad01", "phillbr01", "phillbr01", "phillbr01", "phillbr01", "phillbr01", "phillbr01", "phillbr01", "phillbr01", "phillbr01", "phillbr01", "phillbr01", "phillbr01", "phillbr01", "phillbr01", "molinya01", "molinya01",
+#> "molinya01", "molinya01", "molinya01", "molinya01", "molinya01", "molinya01", "molinya01", "molinya01", "molinya01", "molinya01", "mclouna01", "mclouna01", "mclouna01", "mclouna01", "mclouna01", "mclouna01", "mclouna01", "mclouna01", "mclouna01", "mclouna01", "mclouna01", "mclouna01", "victosh01", "victosh01", "victosh01", "victosh01", "victosh01", "victosh01", "victosh01", "victosh01", "victosh01", "victosh01", "victosh01", "victosh01", "victosh01", "victosh01", "ramirar01", "ramirar01", "ramirar01",
+#> "ramirar01", "ramirar01", "ramirar01", "ramirar01", "ramirar01", "ramirar01", "ramirar01", "ramirar01", "ramirar01", "ramirar01", "ramirar01", "ramirar01", "ramirar01", "ramirar01", "ramirar01", "ramirar01", "ramirar01", "lestejo01", "lestejo01", "lestejo01", "lestejo01", "lestejo01", "lestejo01", "lestejo01", "lestejo01", "lestejo01", "lestejo01", "lestejo01", "longoev01", "longoev01", "longoev01", "longoev01", "longoev01", "longoev01", "longoev01", "longoev01", "sotoge01", "sotoge01", "sotoge01",
+#> "sotoge01", "sotoge01", "sotoge01", "sotoge01", "sotoge01", "sotoge01", "sotoge01", "sotoge01", "sotoge01", "sotoge01", "huffau01", "huffau01", "huffau01", "huffau01", "huffau01", "huffau01", "huffau01", "huffau01", "huffau01", "huffau01", "huffau01", "huffau01", "huffau01", "huffau01", "huffau01", "hamiljo03", "hamiljo03", "hamiljo03", "hamiljo03", "hamiljo03", "hamiljo03", "hamiljo03", "hamiljo03", "hamiljo03", "quentca01", "quentca01", "quentca01", "quentca01", "quentca01", "quentca01", "quentca01",
+#> "quentca01", "quentca01", "ludwiry01", "ludwiry01", "ludwiry01", "ludwiry01", "ludwiry01", "ludwiry01", "ludwiry01", "ludwiry01", "ludwiry01", "ludwiry01", "ludwiry01", "ludwiry01", "ludwiry01", "ludwiry01", "ludwiry01", "crawfca02", "crawfca02", "crawfca02", "crawfca02", "crawfca02", "crawfca02", "crawfca02", "crawfca02", "crawfca02", "crawfca02", "crawfca02", "crawfca02", "crawfca02", "crawfca02", "hillaa01", "hillaa01", "hillaa01", "hillaa01", "hillaa01", "hillaa01", "hillaa01", "hillaa01", "hillaa01",
+#> "hillaa01", "hillaa01", "hillaa01", "carpech02", "carpech02", "greinza01", "greinza01", "greinza01", "greinza01", "greinza01", "greinza01", "greinza01", "greinza01", "greinza01", "greinza01", "greinza01", "greinza01", "greinza01", "jonesad01", "jonesad01", "jonesad01", "jonesad01", "jonesad01", "jonesad01", "jonesad01", "jonesad01", "jonesad01", "jonesad01", "buehrma01", "buehrma01", "buehrma01", "buehrma01", "buehrma01", "buehrma01", "buehrma01", "buehrma01", "buehrma01", "buehrma01", "buehrma01",
+#> "buehrma01", "buehrma01", "buehrma01", "buehrma01", "buehrma01", "zimmery01", "zimmery01", "zimmery01", "zimmery01", "zimmery01", "zimmery01", "zimmery01", "zimmery01", "zimmery01", "zimmery01", "zimmery01", "bournmi01", "bournmi01", "bournmi01", "bournmi01", "bournmi01", "bournmi01", "bournmi01", "bournmi01", "bournmi01", "bournmi01", "bournmi01", "bournmi01", "kempma01", "kempma01", "kempma01", "kempma01", "kempma01", "kempma01", "kempma01", "kempma01", "kempma01", "kempma01", "wainwad01", "wainwad01",
+#> "wainwad01", "wainwad01", "wainwad01", "wainwad01", "wainwad01", "wainwad01", "wainwad01", "wainwad01", "teahema01", "teahema01", "teahema01", "teahema01", "teahema01", "teahema01", "teahema01", "teahema01", "bellhe01", "bellhe01", "bellhe01", "bellhe01", "bellhe01", "bellhe01", "bellhe01", "bellhe01", "bellhe01", "bellhe01", "bellhe01", "bailean01", "bailean01", "bailean01", "bailean01", "bailean01", "bailean01", "coghlch01", "coghlch01", "coghlch01", "coghlch01", "coghlch01", "coghlch01", "coghlch01",
+#> "lindad01", "lindad01", "lindad01", "lindad01", "lindad01", "lindad01", "lindad01", "lindad01", "lindad01", "lindad01", "ethiean01", "ethiean01", "ethiean01", "ethiean01", "ethiean01", "ethiean01", "ethiean01", "ethiean01", "ethiean01", "ethiean01", "frankry01", "frankry01", "frankry01", "frankry01", "frankry01", "frankry01", "frankry01", "frankry01", "frankry01", "frankry01", "frankry01", "frankry01", "frankry01", "matsuhi01", "matsuhi01", "matsuhi01", "matsuhi01", "matsuhi01", "matsuhi01", "matsuhi01",
+#> "matsuhi01", "matsuhi01", "matsuhi01", "liriafr01", "liriafr01", "liriafr01", "liriafr01", "liriafr01", "liriafr01", "liriafr01", "liriafr01", "liriafr01", "liriafr01", "liriafr01", "hudsoti01", "hudsoti01", "hudsoti01", "hudsoti01", "hudsoti01", "hudsoti01", "hudsoti01", "hudsoti01", "hudsoti01", "hudsoti01", "hudsoti01", "hudsoti01", "hudsoti01", "hudsoti01", "hudsoti01", "hudsoti01", "hudsoti01", "hernafe02", "hernafe02", "hernafe02", "hernafe02", "hernafe02", "hernafe02", "hernafe02", "hernafe02",
+#> "hernafe02", "hernafe02", "hernafe02", "gutiefr01", "gutiefr01", "gutiefr01", "gutiefr01", "gutiefr01", "gutiefr01", "gutiefr01", "gutiefr01", "gutiefr01", "gutiefr01", "gonzaca01", "gonzaca01", "gonzaca01", "gonzaca01", "gonzaca01", "gonzaca01", "gonzaca01", "gonzaca01", "arroybr01", "arroybr01", "arroybr01", "arroybr01", "arroybr01", "arroybr01", "arroybr01", "arroybr01", "arroybr01", "arroybr01", "arroybr01", "arroybr01", "arroybr01", "arroybr01", "arroybr01", "tulowtr01", "tulowtr01", "tulowtr01",
+#> "tulowtr01", "tulowtr01", "tulowtr01", "tulowtr01", "tulowtr01", "tulowtr01", "tulowtr01", "tulowtr01", "bautijo02", "bautijo02", "bautijo02", "bautijo02", "bautijo02", "bautijo02", "bautijo02", "bautijo02", "bautijo02", "bautijo02", "bautijo02", "bautijo02", "bautijo02", "bautijo02", "bautijo02", "bautijo02", "vottojo01", "vottojo01", "vottojo01", "vottojo01", "vottojo01", "vottojo01", "vottojo01", "vottojo01", "vottojo01", "rossco01", "rossco01", "rossco01", "rossco01", "rossco01", "rossco01",
+#> "rossco01", "rossco01", "rossco01", "rossco01", "rossco01", "rossco01", "rossco01", "rossco01", "rossco01", "wakefti01", "wakefti01", "wakefti01", "wakefti01", "wakefti01", "wakefti01", "wakefti01", "wakefti01", "wakefti01", "wakefti01", "wakefti01", "wakefti01", "wakefti01", "wakefti01", "wakefti01", "wakefti01", "wakefti01", "wakefti01", "wakefti01", "soriara01", "soriara01", "soriara01", "soriara01", "soriara01", "soriara01", "soriara01", "soriara01", "soriara01", "soriara01", "soriara01", "soriara01",
+#> "soriara01", "soriara01", "felizne01", "felizne01", "felizne01", "felizne01", "felizne01", "felizne01", "felizne01", "felizne01", "poseybu01", "poseybu01", "poseybu01", "poseybu01", "poseybu01", "poseybu01", "poseybu01", "ramiral03", "ramiral03", "ramiral03", "ramiral03", "ramiral03", "ramiral03", "ramiral03", "ramiral03", "ugglada01", "ugglada01", "ugglada01", "ugglada01", "ugglada01", "ugglada01", "ugglada01", "ugglada01", "ugglada01", "ugglada01", "ugglada01", "gallayo01", "gallayo01", "gallayo01",
+#> "gallayo01", "gallayo01", "gallayo01", "gallayo01", "gallayo01", "gallayo01", "cruzne02", "cruzne02", "cruzne02", "cruzne02", "cruzne02", "cruzne02", "cruzne02", "cruzne02", "cruzne02", "cruzne02", "cruzne02", "freesda01", "freesda01", "freesda01", "freesda01", "freesda01", "freesda01", "freesda01", "ellsbja01", "ellsbja01", "ellsbja01", "ellsbja01", "ellsbja01", "ellsbja01", "ellsbja01", "ellsbja01", "ellsbja01", "kershcl01", "kershcl01", "kershcl01", "kershcl01", "kershcl01", "kershcl01", "kershcl01",
+#> "kershcl01", "wietema01", "wietema01", "wietema01", "wietema01", "wietema01", "wietema01", "wietema01", "gordoal01", "gordoal01", "gordoal01", "gordoal01", "gordoal01", "gordoal01", "gordoal01", "gordoal01", "gordoal01", "markani01", "markani01", "markani01", "markani01", "markani01", "markani01", "markani01", "markani01", "markani01", "markani01", "aybarer01", "aybarer01", "aybarer01", "aybarer01", "aybarer01", "aybarer01", "aybarer01", "aybarer01", "aybarer01", "aybarer01", "parrage01", "parrage01",
+#> "parrage01", "parrage01", "parrage01", "parrage01", "parrage01", "parrage01", "parrage01", "butlebi03", "butlebi03", "butlebi03", "butlebi03", "butlebi03", "butlebi03", "butlebi03", "butlebi03", "butlebi03", "axforjo01", "axforjo01", "axforjo01", "axforjo01", "axforjo01", "axforjo01", "axforjo01", "axforjo01", "axforjo01", "hellije01", "hellije01", "hellije01", "hellije01", "hellije01", "hellije01", "kimbrcr01", "kimbrcr01", "kimbrcr01", "kimbrcr01", "kimbrcr01", "kimbrcr01", "avilaal01", "avilaal01",
+#> "avilaal01", "avilaal01", "avilaal01", "avilaal01", "avilaal01", "grandcu01", "grandcu01", "grandcu01", "grandcu01", "grandcu01", "grandcu01", "grandcu01", "grandcu01", "grandcu01", "grandcu01", "grandcu01", "grandcu01", "cabreas01", "cabreas01", "cabreas01", "cabreas01", "cabreas01", "cabreas01", "cabreas01", "cabreas01", "cabreas01", "cabreas01", "uptonju01", "uptonju01", "uptonju01", "uptonju01", "uptonju01", "uptonju01", "uptonju01", "uptonju01", "uptonju01", "hudsoda01", "hudsoda01", "hudsoda01",
+#> "hudsoda01", "hudsoda01", "hudsoda01", "hudsoda01", "youngde03", "youngde03", "youngde03", "youngde03", "youngde03", "youngde03", "youngde03", "youngde03", "youngde03", "youngde03", "youngde03", "youngde03", "cabreme01", "cabreme01", "cabreme01", "cabreme01", "cabreme01", "cabreme01", "cabreme01", "cabreme01", "cabreme01", "cabreme01", "cabreme01", "sandopa01", "sandopa01", "sandopa01", "sandopa01", "sandopa01", "sandopa01", "sandopa01", "sandopa01", "dickera01", "dickera01", "dickera01", "dickera01",
+#> "dickera01", "dickera01", "dickera01", "dickera01", "dickera01", "dickera01", "dickera01", "dickera01", "dickera01", "rodnefe01", "rodnefe01", "rodnefe01", "rodnefe01", "rodnefe01", "rodnefe01", "rodnefe01", "rodnefe01", "rodnefe01", "rodnefe01", "rodnefe01", "rodnefe01", "rodnefe01", "rodnefe01", "priceda01", "priceda01", "priceda01", "priceda01", "priceda01", "priceda01", "priceda01", "priceda01", "priceda01", "priceda01", "reddijo01", "reddijo01", "reddijo01", "reddijo01", "reddijo01", "reddijo01",
+#> "reddijo01", "hardyjj01", "hardyjj01", "hardyjj01", "hardyjj01", "hardyjj01", "hardyjj01", "hardyjj01", "hardyjj01", "hardyjj01", "hardyjj01", "hardyjj01", "larocad01", "larocad01", "larocad01", "larocad01", "larocad01", "larocad01", "larocad01", "larocad01", "larocad01", "larocad01", "larocad01", "larocad01", "larocad01", "larocad01", "barneda01", "barneda01", "barneda01", "barneda01", "barneda01", "barneda01", "barneda01", "barneda01", "headlch01", "headlch01", "headlch01", "headlch01", "headlch01",
+#> "headlch01", "headlch01", "headlch01", "headlch01", "headlch01", "mccutan01", "mccutan01", "mccutan01", "mccutan01", "mccutan01", "mccutan01", "mccutan01", "heywaja01", "heywaja01", "heywaja01", "heywaja01", "heywaja01", "heywaja01", "scutama01", "scutama01", "scutama01", "scutama01", "scutama01", "scutama01", "scutama01", "scutama01", "scutama01", "scutama01", "scutama01", "scutama01", "scutama01", "scutama01", "troutmi01", "troutmi01", "troutmi01", "troutmi01", "troutmi01", "harpebr03", "harpebr03",
+#> "harpebr03", "harpebr03", "pierzaj01", "pierzaj01", "pierzaj01", "pierzaj01", "pierzaj01", "pierzaj01", "pierzaj01", "pierzaj01", "pierzaj01", "pierzaj01", "pierzaj01", "pierzaj01", "pierzaj01", "pierzaj01", "pierzaj01", "pierzaj01", "pierzaj01", "pierzaj01", "pierzaj01", "willijo03", "willijo03", "willijo03", "willijo03", "willijo03", "willijo03", "willijo03", "willijo03", "willijo03", "willijo03", "willijo03", "willijo03", "braunry01", "braunry01", "bruceja01", "bruceja01", "bruceja01", "bruceja01",
+#> "bruceja01", "bruceja01", "bruceja01", "bruceja01", "strasst01", "strasst01", "strasst01", "strasst01", "strasst01", "strasst01", "desmoia01", "desmoia01", "desmoia01", "desmoia01", "desmoia01", "desmoia01", "desmoia01", "ueharko01", "ueharko01", "ueharko01", "ueharko01", "ueharko01", "ueharko01", "ueharko01", "ueharko01", "scherma01", "scherma01", "scherma01", "scherma01", "scherma01", "scherma01", "scherma01", "scherma01", "hosmeer01", "hosmeer01", "hosmeer01", "hosmeer01", "hosmeer01", "machama01",
+#> "machama01", "machama01", "machama01", "perezsa02", "perezsa02", "perezsa02", "perezsa02", "perezsa02", "goldspa01", "goldspa01", "goldspa01", "goldspa01", "goldspa01", "arenano01", "arenano01", "arenano01", "gomezca01", "gomezca01", "gomezca01", "gomezca01", "gomezca01", "gomezca01", "gomezca01", "gomezca01", "gomezca01", "gomezca01", "simmoan01", "simmoan01", "simmoan01", "simmoan01", "wachami01", "wachami01", "wachami01", "myerswi01", "myerswi01", "myerswi01", "fernajo02", "fernajo02", "fernajo02",
+#> "davisch02", "davisch02", "davisch02", "davisch02", "davisch02", "davisch02", "davisch02", "davisch02", "davisch02", "carpema01", "carpema01", "carpema01", "carpema01", "carpema01", "alvarpe01", "alvarpe01", "alvarpe01", "alvarpe01", "alvarpe01", "alvarpe01", "cuddymi01", "cuddymi01", "cuddymi01", "cuddymi01", "cuddymi01", "cuddymi01", "cuddymi01", "cuddymi01", "cuddymi01", "cuddymi01", "cuddymi01", "cuddymi01", "cuddymi01", "cuddymi01", "cuddymi01", "cainlo01", "cainlo01", "cainlo01", "cainlo01",
+#> "cainlo01", "cainlo01", "rizzoan01", "rizzoan01", "rizzoan01", "rizzoan01", "rizzoan01", "youngch03", "youngch03", "youngch03", "youngch03", "youngch03", "youngch03", "youngch03", "youngch03", "youngch03", "youngch03", "youngch03", "mcgehca01", "mcgehca01", "mcgehca01", "mcgehca01", "mcgehca01", "mcgehca01", "mcgehca01", "mcgehca01", "mcgehca01", "klubeco01", "klubeco01", "klubeco01", "klubeco01", "klubeco01", "seageky01", "seageky01", "seageky01", "seageky01", "seageky01", "keuchda01", "keuchda01",
+#> "keuchda01", "keuchda01", "lemahdj01", "lemahdj01", "lemahdj01", "lemahdj01", "lemahdj01", "lagarju01", "lagarju01", "lagarju01", "yelicch01", "yelicch01", "yelicch01", "stantmi03", "stantmi03", "stantmi03", "stantmi03", "stantmi03", "stantmi03", "bumgama01", "bumgama01", "bumgama01", "bumgama01", "bumgama01", "bumgama01", "bumgama01", "abreujo02", "abreujo02", "degroja01", "degroja01", "altuvjo01", "altuvjo01", "altuvjo01", "altuvjo01", "altuvjo01", "gomesya01", "gomesya01", "gomesya01", "gomesya01",
+#> "brantmi02", "brantmi02", "brantmi02", "brantmi02", "brantmi02", "brantmi02", "brantmi02", "walkene01", "walkene01", "walkene01", "walkene01", "walkene01", "walkene01", "walkene01", "rendoan01", "rendoan01", "rendoan01", "escobal02", "escobal02", "escobal02", "escobal02", "escobal02", "escobal02", "escobal02", "escobal02", "harvema01", "harvema01", "harvema01", "arrieja01", "arrieja01", "arrieja01", "arrieja01", "arrieja01", "arrieja01", "arrieja01", "kiermke01", "kiermke01", "kiermke01", "cespeyo01",
+#> "cespeyo01", "cespeyo01", "cespeyo01", "cespeyo01", "cespeyo01", "calhoko01", "calhoko01", "calhoko01", "calhoko01", "gordode01", "gordode01", "gordode01", "gordode01", "gordode01", "polloaj01", "polloaj01", "polloaj01", "polloaj01", "martest01", "martest01", "martest01", "martest01", "crawfbr01", "crawfbr01", "crawfbr01", "crawfbr01", "crawfbr01", "donaljo02", "donaljo02", "donaljo02", "donaljo02", "donaljo02", "murphda08", "murphda08", "murphda08", "murphda08", "murphda08", "murphda08", "murphda08",
+#> "correca01", "bryankr01", "moralke01", "moralke01", "moralke01", "moralke01", "moralke01", "moralke01", "moralke01", "moralke01", "moralke01", "moralke01", "martijd02", "martijd02", "martijd02", "martijd02", "martijd02", "bogaexa01", "bogaexa01", "bogaexa01") x c(1874, 1875, 1876, 1877, 1878, 1879, 1880, 1881, 1882, 1884, 1884, 1872, 1873, 1874, 1875, 1876, 1877, 1878, 1879, 1880, 1881, 1882, 1883, 1884, 1885, 1886, 1887, 1888, 1889, 1890, 1890, 1891, 1882, 1883, 1884, 1885, 1886, 1887, 1888, 1889, 1890, 1880, 1881, 1882, 1883, 1884, 1885, 1886, 1887, 1888, 1889, 1890, 1891, 1883, 1884, 1885, 1886, 1887, 1888, 1889, 1890, 1891, 1892, 1880, 1881, 1882, 1883, 1884, 1885, 1886, 1887, 1888, 1889, 1890, 1891, 1891, 1892, 1893, 1882, 1884, 1885, 1886, 1887, 1888,
+#> 1889, 1890, 1891, 1892, 1892, 1893, 1894, 1889, 1890, 1891, 1892, 1893, 1894, 1895, 1897, 1898, 1901, 1888, 1889, 1890, 1891, 1892, 1893, 1894, 1895, 1896, 1897, 1898, 1899, 1900, 1901, 1904, 1905, 1906, 1890, 1891, 1892, 1893, 1894, 1895, 1896, 1897, 1898, 1899, 1900, 1901, 1902, 1903, 1904, 1905, 1906, 1907, 1908, 1909, 1910, 1911, 1911, 1896, 1897, 1898, 1899, 1900, 1901, 1902, 1902, 1903, 1904, 1905, 1906, 1907, 1908, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1916, 1897, 1899, 1900, 1901, 1901,
+#> 1902, 1903, 1904, 1905, 1906, 1907, 1908, 1909, 1910, 1900, 1901, 1902, 1903, 1904, 1905, 1906, 1907, 1908, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1916, 1916, 1905, 1906, 1907, 1908, 1909, 1910, 1911, 1912, 1913, 1913, 1914, 1914, 1915, 1916, 1917, 1918, 1919, 1907, 1908, 1909, 1910, 1910, 1911, 1912, 1913, 1914, 1915, 1896, 1897, 1898, 1899, 1900, 1901, 1902, 1903, 1904, 1905, 1906, 1907, 1908, 1909, 1910, 1912, 1899, 1900, 1901, 1902, 1903, 1904, 1905, 1906, 1907, 1908, 1909, 1910, 1911, 1912,
+#> 1914, 1916, 1899, 1900, 1901, 1902, 1903, 1904, 1905, 1906, 1907, 1908, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1916, 1917, 1903, 1905, 1906, 1907, 1908, 1909, 1910, 1904, 1905, 1906, 1907, 1908, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1916, 1917, 1902, 1903, 1904, 1905, 1906, 1907, 1908, 1909, 1910, 1898, 1899, 1900, 1901, 1902, 1903, 1904, 1905, 1906, 1907, 1908, 1909, 1910, 1911, 1912, 1915, 1916, 1918, 1905, 1906, 1907, 1908, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1916, 1917, 1918, 1919,
+#> 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1894, 1895, 1896, 1897, 1898, 1899, 1900, 1901, 1902, 1903, 1904, 1905, 1906, 1907, 1908, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1916, 1917, 1918, 1904, 1905, 1906, 1907, 1908, 1909, 1910, 1911, 1912, 1913, 1897, 1900, 1901, 1902, 1902, 1903, 1904, 1905, 1906, 1907, 1908, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1900, 1901, 1902, 1903, 1904, 1905, 1906, 1907, 1908, 1910, 1911, 1911, 1912, 1913, 1899, 1900, 1901, 1902, 1903, 1904, 1904, 1905,
+#> 1906, 1908, 1911, 1911, 1912, 1914, 1894, 1895, 1896, 1897, 1898, 1899, 1900, 1901, 1902, 1903, 1904, 1905, 1906, 1907, 1908, 1909, 1910, 1911, 1913, 1914, 1915, 1903, 1904, 1905, 1906, 1907, 1908, 1909, 1910, 1911, 1912, 1913, 1914, 1914, 1915, 1916, 1907, 1908, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1916, 1897, 1898, 1899, 1900, 1901, 1902, 1903, 1904, 1905, 1906, 1907, 1908, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1916, 1917, 1894, 1895, 1896, 1897, 1898, 1899, 1900, 1901, 1902, 1903, 1904,
+#> 1905, 1906, 1907, 1908, 1909, 1911, 1902, 1903, 1904, 1905, 1906, 1907, 1908, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1916, 1917, 1917, 1922, 1929, 1898, 1899, 1900, 1901, 1902, 1903, 1904, 1905, 1906, 1907, 1908, 1909, 1910, 1905, 1906, 1907, 1908, 1909, 1910, 1911, 1912, 1913, 1913, 1914, 1915, 1916, 1917, 1904, 1905, 1906, 1907, 1908, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1916, 1916, 1917, 1917, 1918, 1906, 1907, 1908, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1916, 1917, 1918, 1919, 1920,
+#> 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1906, 1908, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1916, 1904, 1905, 1905, 1905, 1908, 1909, 1910, 1911, 1912, 1931, 1907, 1908, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1916, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1901, 1902, 1903, 1904, 1905, 1906, 1907, 1908, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1916, 1917, 1907, 1908, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1916, 1917, 1918, 1919, 1920, 1921,
+#> 1922, 1923, 1924, 1925, 1926, 1927, 1902, 1903, 1904, 1905, 1906, 1907, 1908, 1909, 1910, 1911, 1912, 1913, 1913, 1914, 1915, 1908, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1917, 1918, 1919, 1920, 1921, 1922, 1908, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1916, 1917, 1918, 1919, 1920, 1921, 1921, 1922, 1923, 1905, 1906, 1907, 1908, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1916, 1917, 1918, 1906, 1907, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1916, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925,
+#> 1926, 1898, 1899, 1900, 1901, 1902, 1903, 1904, 1905, 1906, 1907, 1908, 1909, 1910, 1911, 1912, 1913, 1914, 1898, 1899, 1900, 1901, 1902, 1903, 1904, 1905, 1906, 1907, 1908, 1909, 1910, 1911, 1912, 1912, 1913, 1914, 1915, 1918, 1904, 1906, 1907, 1908, 1909, 1910, 1911, 1912, 1913, 1913, 1914, 1915, 1903, 1904, 1905, 1906, 1907, 1908, 1909, 1910, 1911, 1912, 1912, 1913, 1914, 1915, 1916, 1916, 1906, 1907, 1908, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1908, 1909, 1910, 1911, 1912, 1913, 1914, 1915,
+#> 1919, 1906, 1907, 1908, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1916, 1917, 1918, 1920, 1903, 1904, 1905, 1906, 1907, 1908, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1916, 1917, 1925, 1904, 1907, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1916, 1917, 1918, 1918, 1918, 1904, 1905, 1906, 1907, 1908, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1916, 1917, 1917, 1918, 1919, 1909, 1910, 1911, 1912, 1912, 1914, 1915, 1908, 1909, 1910, 1911, 1912, 1913, 1914, 1916, 1917, 1918, 1919, 1921, 1922, 1906, 1909,
+#> 1910, 1911, 1912, 1913, 1914, 1915, 1916, 1917, 1918, 1919, 1920, 1925, 1911, 1912, 1913, 1914, 1914, 1915, 1916, 1918, 1925, 1908, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1915, 1916, 1917, 1918, 1919, 1920, 1902, 1903, 1904, 1905, 1906, 1907, 1908, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1915, 1916, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1916, 1917, 1917, 1911, 1912, 1913, 1914, 1915, 1916, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1926, 1927, 1928, 1929, 1930, 1910, 1911,
+#> 1912, 1913, 1914, 1915, 1916, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1907, 1908, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1916, 1916, 1917, 1918, 1919, 1920, 1903, 1905, 1906, 1907, 1908, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1916, 1917, 1908, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1915, 1916, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1916, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1908, 1909, 1910, 1911,
+#> 1912, 1913, 1914, 1915, 1916, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1910, 1911, 1912, 1913, 1914, 1915, 1916, 1917, 1918, 1919, 1920, 1921, 1921, 1922, 1923, 1923, 1924, 1902, 1906, 1907, 1908, 1909, 1910, 1911, 1912, 1913, 1915, 1916, 1918, 1907, 1908, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1916, 1916, 1917, 1918, 1919, 1907, 1908, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1916, 1917, 1918, 1919, 1920, 1921, 1908, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1916, 1912, 1913, 1914, 1915,
+#> 1916, 1917, 1918, 1913, 1914, 1915, 1916, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1903, 1905, 1906, 1907, 1908, 1908, 1909, 1910, 1911, 1913, 1914, 1915, 1915, 1917, 1908, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1915, 1916, 1917, 1919, 1912, 1913, 1914, 1915, 1916, 1908, 1909, 1909, 1912, 1913, 1914, 1915, 1916, 1917, 1918, 1919, 1920, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1916, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927,
+#> 1912, 1913, 1914, 1915, 1916, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1913, 1914, 1915, 1916, 1917, 1918, 1919, 1920, 1921, 1924, 1925, 1912, 1913, 1914, 1915, 1916, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1935, 1911, 1912, 1913, 1914, 1915, 1916, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1929, 1911, 1912, 1913, 1914, 1915, 1916, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925,
+#> 1913, 1914, 1915, 1919, 1913, 1914, 1915, 1916, 1917, 1918, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1916, 1917, 1912, 1913, 1913, 1914, 1915, 1916, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1912, 1913, 1914, 1915, 1916, 1917, 1918, 1919, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1915, 1916, 1917, 1918, 1919, 1920, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1911, 1912, 1913, 1914, 1915, 1916, 1917, 1919, 1912, 1913, 1914, 1915, 1916, 1917,
+#> 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1913, 1914, 1915, 1916, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1915, 1916, 1917, 1918, 1919, 1920, 1921, 1922, 1924, 1925, 1926, 1927, 1928, 1928, 1929, 1930, 1914, 1915, 1916, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1908, 1909, 1910, 1911, 1911, 1912, 1913, 1914, 1915, 1916, 1916, 1917, 1918, 1919, 1919, 1920, 1915, 1916, 1917, 1918, 1919,
+#> 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1933, 1934, 1935, 1936, 1937, 1910, 1911, 1911, 1912, 1913, 1914, 1915, 1916, 1917, 1919, 1920, 1921, 1922, 1923, 1923, 1924, 1925, 1929, 1930, 1912, 1914, 1915, 1916, 1917, 1919, 1919, 1920, 1921, 1921, 1922, 1912, 1913, 1914, 1915, 1916, 1917, 1918, 1919, 1920, 1915, 1916, 1917, 1918, 1919, 1920, 1905, 1908, 1909, 1910, 1911, 1912, 1912, 1913, 1914, 1915, 1916, 1917, 1918, 1919, 1920, 1912, 1913, 1914, 1915, 1916,
+#> 1917, 1918, 1919, 1920, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1916, 1917, 1918, 1919, 1920, 1921, 1913, 1914, 1915, 1916, 1916, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1931, 1910, 1911, 1912, 1913, 1914, 1915, 1916, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1926, 1927, 1928, 1929, 1912, 1913, 1914, 1915, 1916, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1926, 1911, 1912, 1913, 1914, 1915, 1916, 1917, 1918, 1919, 1920, 1921,
+#> 1922, 1923, 1924, 1925, 1927, 1928, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1916, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1908, 1910, 1911, 1912, 1912, 1913, 1914, 1915, 1916, 1917, 1918, 1919, 1920, 1921, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1912, 1913, 1914, 1915, 1916, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1916, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1930, 1931, 1932, 1933, 1933, 1934, 1934, 1934, 1910, 1912, 1913, 1913, 1914,
+#> 1915, 1916, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1913, 1914, 1915, 1916, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1909, 1911, 1914, 1915, 1916, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1925, 1925, 1915, 1916, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1923, 1924, 1925, 1926, 1927, 1915, 1916, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1912, 1916, 1917, 1918, 1919, 1920, 1921,
+#> 1922, 1923, 1912, 1916, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1916, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1914, 1915, 1916, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1925, 1926, 1926, 1916, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1914, 1915, 1916, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933,
+#> 1915, 1916, 1917, 1918, 1919, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1915, 1916, 1917, 1917, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1930, 1932, 1916, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1915, 1916, 1917, 1918, 1919, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1926, 1927, 1927, 1928, 1929, 1917, 1918,
+#> 1919, 1920, 1921, 1922, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1931, 1912, 1913, 1914, 1915, 1916, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1926, 1927, 1927, 1928, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1912, 1913, 1914, 1915, 1916, 1917, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1917, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1926, 1927, 1913, 1915, 1916, 1917, 1918,
+#> 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1915, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1934, 1914, 1916, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1932, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1933, 1933, 1934, 1936, 1915, 1916, 1917, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1926, 1927, 1928, 1929, 1930, 1920, 1921, 1922, 1923, 1924,
+#> 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1916, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1915, 1916, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1925, 1926, 1927, 1928, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1934, 1935, 1914, 1915, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1929, 1930, 1915,
+#> 1915, 1918, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1934, 1935, 1915, 1916, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1933, 1934, 1913, 1914, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1915, 1916, 1917, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1923, 1923, 1924, 1925, 1926, 1927, 1930, 1931, 1932, 1933, 1912, 1913, 1914, 1915, 1915, 1916, 1917, 1919,
+#> 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1937, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938,
+#> 1939, 1915, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1931, 1932, 1933, 1934, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1939, 1940, 1941, 1943, 1944, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932,
+#> 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1942, 1946, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1935, 1936, 1937, 1938, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1935, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1919, 1920, 1921, 1922, 1923, 1923, 1924, 1924, 1925, 1926, 1927, 1928, 1928, 1929, 1930, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1930, 1931,
+#> 1931, 1932, 1914, 1915, 1916, 1917, 1918, 1919, 1920, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1928, 1929, 1929, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1931, 1932, 1933, 1934, 1935, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1938, 1939, 1918, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1924, 1925, 1926,
+#> 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1934, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1927, 1928, 1929, 1930, 1921, 1925, 1926, 1927, 1928, 1929, 1930, 1930, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1939, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926,
+#> 1927, 1928, 1929, 1930, 1930, 1931, 1931, 1932, 1932, 1933, 1934, 1935, 1936, 1937, 1937, 1938, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1932, 1933, 1934, 1935, 1935, 1936, 1937, 1937, 1923, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1918, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1941,
+#> 1942, 1943, 1944, 1944, 1945, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1923, 1924, 1925, 1926, 1927, 1928, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1941, 1941, 1942, 1944, 1944, 1945, 1926, 1927, 1927, 1928, 1929, 1930, 1930, 1931, 1932, 1933, 1934, 1934, 1935, 1936, 1922, 1928, 1929, 1930, 1931, 1923, 1924, 1925, 1926, 1927, 1927,
+#> 1928, 1929, 1930, 1930, 1931, 1932, 1933, 1934, 1935, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1937, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1930, 1931, 1932, 1932, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1921, 1922, 1923, 1924, 1925, 1927, 1928, 1929, 1930, 1931, 1931, 1932, 1933, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1942,
+#> 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1935, 1936, 1936, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1937, 1938, 1938, 1939, 1940, 1941, 1927, 1928, 1929, 1930, 1931, 1932, 1932, 1933, 1934, 1934, 1935, 1936,
+#> 1938, 1939, 1939, 1940, 1946, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1942, 1943, 1919, 1920, 1922, 1923, 1928, 1929, 1930, 1931, 1932, 1933, 1933, 1934, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1942, 1942, 1944, 1945, 1929, 1930, 1931, 1932,
+#> 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1939, 1940, 1941, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1942, 1943, 1944, 1945, 1925, 1926, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1936, 1937, 1938, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1935, 1936, 1937, 1923, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1931,
+#> 1932, 1933, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1942, 1943, 1944, 1945, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1937, 1938, 1939, 1940, 1941, 1942, 1943, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1936, 1937, 1938, 1939, 1939, 1940, 1941, 1942, 1943, 1944, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1942, 1943, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1942, 1942, 1943, 1945,
+#> 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1941, 1942, 1943, 1946, 1946, 1947, 1924, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1933, 1934, 1934, 1935, 1936, 1937, 1930, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1947, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1941, 1942, 1943, 1946, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1942, 1943, 1946, 1930, 1933, 1934, 1935, 1936,
+#> 1937, 1938, 1939, 1940, 1941, 1942, 1943, 1944, 1946, 1946, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1938, 1939, 1940, 1941, 1942, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1942, 1943, 1945, 1946, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1937, 1938, 1938, 1939, 1940, 1940, 1928, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938,
+#> 1939, 1940, 1940, 1941, 1942, 1943, 1944, 1945, 1946, 1947, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1940, 1941, 1942, 1943, 1943, 1944, 1945, 1945, 1946, 1947, 1948, 1927, 1928, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1937, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1942, 1943, 1947, 1948, 1930, 1933, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1942, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1942, 1942, 1943, 1946, 1947, 1948,
+#> 1949, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1942, 1943, 1944, 1945, 1946, 1947, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1942, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1942, 1943, 1944, 1945, 1946, 1947, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1942, 1946, 1930, 1933, 1934, 1935, 1936, 1937,
+#> 1938, 1939, 1940, 1941, 1945, 1946, 1947, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1942, 1943, 1944, 1945, 1946, 1947, 1948, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1944, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1942, 1943, 1944, 1945, 1928, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1944, 1931, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1936, 1937, 1938, 1939, 1940, 1941, 1942, 1946, 1947,
+#> 1948, 1949, 1950, 1951, 1934, 1935, 1936, 1937, 1938, 1939, 1939, 1940, 1941, 1941, 1942, 1943, 1944, 1944, 1945, 1945, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1941, 1942, 1943, 1943, 1944, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1942, 1943, 1944, 1945, 1946, 1946, 1947, 1948, 1949, 1950, 1951, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1942, 1943, 1945, 1946, 1947, 1948, 1949, 1950, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1942,
+#> 1943, 1944, 1945, 1946, 1947, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1939, 1940, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1941, 1942, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1932, 1933, 1934, 1935, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1943, 1930, 1931, 1933, 1935, 1936, 1937, 1938, 1939, 1939, 1940, 1928, 1929, 1930, 1931, 1932, 1933, 1933, 1934, 1935, 1936, 1936, 1937, 1938, 1939, 1937, 1938, 1939, 1940, 1940, 1945, 1936, 1937, 1938,
+#> 1939, 1940, 1941, 1942, 1946, 1947, 1948, 1949, 1949, 1950, 1951, 1952, 1953, 1932, 1933, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1941, 1942, 1943, 1944, 1937, 1938, 1939, 1940, 1941, 1942, 1942, 1943, 1944, 1945, 1931, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1942, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1942, 1945, 1946, 1947, 1928, 1929, 1930, 1931, 1931, 1932, 1933, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940,
+#> 1941, 1942, 1942, 1943, 1944, 1946, 1947, 1936, 1937, 1938, 1939, 1940, 1941, 1942, 1943, 1944, 1945, 1946, 1946, 1947, 1948, 1949, 1929, 1930, 1932, 1934, 1935, 1935, 1936, 1937, 1937, 1938, 1939, 1939, 1940, 1941, 1942, 1942, 1943, 1943, 1943, 1944, 1945, 1946, 1946, 1947, 1947, 1948, 1952, 1952, 1953, 1937, 1938, 1939, 1940, 1941, 1942, 1943, 1946, 1947, 1948, 1949, 1950, 1951, 1934, 1937, 1938, 1939, 1940, 1941, 1942, 1943, 1944, 1945, 1946, 1947, 1947, 1948, 1931, 1932, 1933, 1934, 1935, 1936,
+#> 1937, 1938, 1939, 1940, 1941, 1942, 1943, 1944, 1945, 1946, 1947, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1942, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1942, 1943, 1943, 1944, 1945, 1945, 1946, 1947, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1942, 1943, 1944, 1938, 1939, 1940, 1941, 1942, 1943, 1946, 1947, 1948, 1949, 1950, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1942, 1943, 1944, 1945, 1936, 1937, 1938, 1939, 1940, 1941, 1945, 1946, 1947, 1948, 1949, 1950, 1951,
+#> 1952, 1953, 1954, 1955, 1956, 1933, 1934, 1935, 1936, 1938, 1939, 1940, 1941, 1942, 1943, 1944, 1945, 1946, 1947, 1948, 1949, 1950, 1951, 1952, 1953, 1939, 1940, 1941, 1942, 1946, 1947, 1948, 1949, 1950, 1951, 1952, 1953, 1954, 1955, 1956, 1957, 1958, 1959, 1960, 1931, 1932, 1933, 1934, 1934, 1935, 1936, 1937, 1938, 1938, 1939, 1940, 1941, 1942, 1943, 1944, 1945, 1946, 1947, 1948, 1950, 1934, 1935, 1936, 1936, 1937, 1938, 1939, 1940, 1940, 1941, 1942, 1943, 1944, 1945, 1946, 1933, 1934, 1935, 1936,
+#> 1937, 1938, 1939, 1940, 1941, 1942, 1943, 1946, 1947, 1947, 1948, 1948, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1946, 1947, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1942, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1942, 1943, 1943, 1944, 1945, 1933, 1934, 1936, 1937, 1938, 1939, 1940, 1941, 1942, 1942, 1943, 1944, 1945, 1945, 1946, 1946, 1947, 1939, 1940, 1941, 1942, 1943, 1945, 1946, 1947, 1948, 1949, 1950, 1951, 1952, 1936, 1939, 1940, 1941, 1942, 1943, 1944, 1945, 1946,
+#> 1947, 1948, 1949, 1950, 1951, 1952, 1953, 1936, 1937, 1939, 1940, 1941, 1942, 1943, 1944, 1945, 1946, 1947, 1948, 1949, 1950, 1938, 1939, 1940, 1941, 1942, 1943, 1944, 1946, 1947, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1942, 1943, 1944, 1945, 1946, 1947, 1948, 1941, 1942, 1943, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1945, 1946, 1947, 1933, 1934, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1942, 1943, 1945, 1937, 1938, 1939, 1940, 1941, 1942, 1943, 1946, 1929, 1930,
+#> 1931, 1932, 1933, 1933, 1934, 1935, 1936, 1937, 1939, 1940, 1941, 1942, 1943, 1944, 1945, 1940, 1941, 1942, 1943, 1946, 1947, 1948, 1939, 1940, 1941, 1942, 1943, 1944, 1945, 1947, 1948, 1949, 1938, 1939, 1940, 1941, 1942, 1940, 1941, 1942, 1946, 1947, 1948, 1949, 1950, 1951, 1952, 1937, 1938, 1939, 1939, 1940, 1941, 1942, 1943, 1946, 1947, 1947, 1948, 1949, 1949, 1950, 1938, 1939, 1940, 1941, 1942, 1946, 1947, 1948, 1949, 1950, 1951, 1952, 1953, 1954, 1955, 1955, 1956, 1956, 1957, 1958, 1959, 1959,
+#> 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1942, 1943, 1944, 1945, 1946, 1947, 1936, 1937, 1938, 1939, 1940, 1941, 1942, 1937, 1938, 1939, 1940, 1941, 1942, 1943, 1944, 1946, 1947, 1948, 1949, 1950, 1941, 1942, 1943, 1944, 1946, 1947, 1948, 1949, 1940, 1941, 1942, 1943, 1944, 1945, 1946, 1947, 1948, 1949, 1938, 1939, 1940, 1941, 1942, 1943, 1944, 1945, 1946, 1947, 1940, 1941, 1942, 1945, 1946, 1947, 1948, 1949, 1950, 1937, 1938, 1939, 1940, 1941, 1942, 1943, 1944, 1945, 1946,
+#> 1947, 1940, 1941, 1942, 1943, 1944, 1946, 1947, 1948, 1949, 1949, 1941, 1942, 1943, 1944, 1945, 1946, 1947, 1948, 1949, 1950, 1951, 1952, 1953, 1953, 1954, 1955, 1955, 1938, 1939, 1940, 1941, 1942, 1943, 1944, 1945, 1945, 1946, 1947, 1947, 1949, 1941, 1942, 1946, 1947, 1948, 1941, 1942, 1946, 1947, 1948, 1949, 1940, 1941, 1942, 1943, 1944, 1945, 1946, 1947, 1948, 1949, 1950, 1952, 1953, 1937, 1938, 1939, 1940, 1941, 1942, 1943, 1944, 1945, 1949, 1950, 1951, 1954, 1942, 1946, 1947, 1948, 1949, 1950,
+#> 1951, 1952, 1952, 1953, 1954, 1954, 1934, 1937, 1938, 1939, 1940, 1941, 1942, 1943, 1944, 1945, 1946, 1947, 1947, 1948, 1943, 1946, 1947, 1948, 1949, 1950, 1951, 1951, 1952, 1953, 1939, 1940, 1941, 1942, 1943, 1944, 1945, 1946, 1947, 1948, 1949, 1950, 1951, 1952, 1952, 1957, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1942, 1943, 1944, 1945, 1941, 1943, 1944, 1946, 1947, 1948, 1949, 1950, 1952, 1941, 1942, 1943, 1944, 1946, 1947, 1948, 1949, 1950, 1951, 1952, 1953, 1954, 1955, 1956, 1957, 1958,
+#> 1959, 1960, 1961, 1962, 1963, 1932, 1938, 1939, 1940, 1941, 1942, 1943, 1944, 1945, 1946, 1947, 1948, 1949, 1940, 1941, 1942, 1943, 1944, 1945, 1946, 1947, 1948, 1949, 1949, 1950, 1950, 1951, 1952, 1953, 1954, 1954, 1955, 1956, 1957, 1937, 1938, 1939, 1940, 1940, 1941, 1942, 1943, 1944, 1945, 1946, 1946, 1943, 1944, 1945, 1946, 1947, 1948, 1949, 1950, 1950, 1951, 1952, 1939, 1940, 1941, 1942, 1943, 1944, 1945, 1946, 1947, 1948, 1949, 1950, 1951, 1952, 1953, 1954, 1955, 1939, 1940, 1941, 1942, 1943,
+#> 1944, 1945, 1946, 1947, 1948, 1949, 1950, 1951, 1952, 1953, 1953, 1942, 1943, 1944, 1945, 1946, 1948, 1949, 1944, 1945, 1946, 1946, 1947, 1948, 1948, 1949, 1950, 1950, 1942, 1943, 1944, 1945, 1946, 1947, 1947, 1948, 1949, 1950, 1937, 1938, 1939, 1940, 1941, 1942, 1943, 1944, 1946, 1947, 1948, 1949, 1950, 1951, 1931, 1933, 1934, 1935, 1936, 1936, 1937, 1938, 1939, 1939, 1940, 1941, 1942, 1943, 1944, 1945, 1946, 1947, 1948, 1949, 1938, 1939, 1941, 1942, 1943, 1944, 1945, 1946, 1947, 1930, 1931, 1932,
+#> 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1940, 1942, 1943, 1943, 1944, 1945, 1932, 1933, 1934, 1935, 1935, 1943, 1944, 1945, 1946, 1945, 1946, 1947, 1948, 1949, 1950, 1941, 1942, 1943, 1944, 1945, 1946, 1947, 1948, 1949, 1950, 1951, 1952, 1953, 1953, 1954, 1955, 1956, 1957, 1941, 1942, 1943, 1944, 1945, 1946, 1947, 1947, 1938, 1939, 1940, 1940, 1941, 1942, 1942, 1942, 1943, 1944, 1945, 1945, 1946, 1947, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1942, 1943, 1944, 1945, 1946, 1947, 1948,
+#> 1949, 1950, 1951, 1952, 1953, 1954, 1955, 1941, 1942, 1943, 1944, 1945, 1946, 1947, 1948, 1949, 1943, 1944, 1945, 1946, 1947, 1948, 1949, 1950, 1951, 1951, 1952, 1953, 1954, 1955, 1956, 1957, 1958, 1959, 1940, 1943, 1944, 1945, 1946, 1947, 1948, 1949, 1950, 1951, 1952, 1953, 1942, 1943, 1944, 1945, 1945, 1946, 1947, 1948, 1949, 1950, 1950, 1950, 1951, 1942, 1943, 1944, 1945, 1946, 1947, 1948, 1949, 1950, 1951, 1952, 1937, 1938, 1939, 1940, 1943, 1944, 1945, 1945, 1946, 1947, 1948, 1949, 1942, 1943,
+#> 1944, 1945, 1946, 1947, 1950, 1951, 1951, 1937, 1938, 1939, 1944, 1945, 1946, 1946, 1936, 1937, 1938, 1943, 1944, 1945, 1946, 1947, 1948, 1939, 1940, 1941, 1942, 1943, 1946, 1947, 1948, 1949, 1950, 1950, 1951, 1952, 1953, 1954, 1955, 1956, 1957, 1958, 1959, 1960, 1943, 1944, 1945, 1946, 1946, 1947, 1948, 1949, 1950, 1951, 1952, 1952, 1953, 1954, 1954, 1955, 1956, 1956, 1957, 1943, 1945, 1946, 1947, 1948, 1949, 1950, 1951, 1951, 1938, 1939, 1940, 1941, 1942, 1943, 1944, 1945, 1946, 1947, 1948, 1949,
+#> 1950, 1951, 1952, 1941, 1942, 1943, 1946, 1947, 1948, 1949, 1950, 1951, 1951, 1952, 1953, 1953, 1954, 1955, 1956, 1956, 1943, 1944, 1944, 1945, 1946, 1947, 1948, 1949, 1950, 1951, 1952, 1953, 1940, 1941, 1942, 1943, 1946, 1947, 1948, 1949, 1950, 1951, 1952, 1953, 1954, 1955, 1956, 1946, 1947, 1948, 1949, 1950, 1951, 1952, 1953, 1954, 1955, 1956, 1957, 1958, 1959, 1959, 1942, 1946, 1947, 1948, 1949, 1950, 1951, 1951, 1952, 1953, 1954, 1955, 1955, 1940, 1941, 1942, 1946, 1947, 1948, 1949, 1950, 1951,
+#> 1952, 1953, 1954, 1955, 1956, 1957, 1958, 1940, 1941, 1942, 1946, 1947, 1948, 1949, 1950, 1951, 1952, 1953, 1936, 1938, 1939, 1940, 1941, 1942, 1943, 1944, 1945, 1946, 1947, 1948, 1946, 1947, 1948, 1949, 1950, 1951, 1952, 1953, 1954, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1965, 1942, 1943, 1944, 1945, 1946, 1947, 1948, 1949, 1950, 1951, 1952, 1953, 1954, 1937, 1938, 1939, 1940, 1941, 1942, 1946, 1947, 1948, 1949, 1950, 1946, 1947, 1948, 1949, 1950, 1951, 1951, 1952, 1954, 1955, 1956,
+#> 1942, 1946, 1947, 1948, 1949, 1950, 1951, 1952, 1952, 1953, 1955, 1946, 1947, 1948, 1949, 1950, 1951, 1952, 1953, 1953, 1954, 1955, 1944, 1945, 1946, 1947, 1948, 1949, 1950, 1951, 1952, 1953, 1953, 1954, 1954, 1956, 1942, 1946, 1947, 1948, 1949, 1950, 1951, 1952, 1953, 1954, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1965, 1942, 1946, 1947, 1948, 1949, 1950, 1951, 1952, 1952, 1953, 1954, 1955, 1947, 1948, 1949, 1950, 1951, 1952, 1953, 1954, 1955, 1956, 1947, 1948, 1949, 1950,
+#> 1951, 1952, 1953, 1954, 1955, 1955, 1936, 1937, 1938, 1939, 1940, 1941, 1942, 1946, 1947, 1947, 1948, 1949, 1950, 1951, 1952, 1941, 1942, 1946, 1947, 1948, 1949, 1950, 1951, 1952, 1953, 1954, 1955, 1956, 1957, 1958, 1946, 1947, 1948, 1949, 1950, 1951, 1952, 1953, 1954, 1955, 1955, 1939, 1940, 1941, 1942, 1943, 1944, 1945, 1946, 1947, 1948, 1949, 1949, 1950, 1951, 1952, 1941, 1942, 1946, 1947, 1948, 1949, 1950, 1951, 1951, 1952, 1952, 1952, 1953, 1953, 1954, 1955, 1956, 1956, 1946, 1948, 1949, 1950,
+#> 1951, 1952, 1953, 1954, 1955, 1956, 1956, 1957, 1958, 1958, 1959, 1960, 1960, 1944, 1945, 1946, 1947, 1948, 1949, 1950, 1954, 1943, 1944, 1945, 1946, 1947, 1948, 1949, 1950, 1950, 1951, 1952, 1952, 1952, 1953, 1954, 1947, 1948, 1949, 1950, 1951, 1952, 1953, 1954, 1955, 1956, 1947, 1948, 1949, 1950, 1951, 1952, 1952, 1953, 1954, 1954, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1961, 1962, 1963, 1963, 1943, 1947, 1948, 1949, 1950, 1951, 1952, 1953, 1954, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962,
+#> 1963, 1941, 1942, 1943, 1946, 1947, 1948, 1949, 1950, 1951, 1952, 1953, 1954, 1955, 1955, 1948, 1949, 1950, 1951, 1952, 1953, 1954, 1955, 1956, 1957, 1949, 1950, 1951, 1954, 1955, 1956, 1957, 1958, 1958, 1959, 1960, 1960, 1949, 1950, 1951, 1952, 1953, 1954, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1964, 1965, 1946, 1947, 1948, 1949, 1950, 1951, 1952, 1953, 1954, 1955, 1956, 1956, 1957, 1941, 1942, 1946, 1947, 1948, 1949, 1950, 1951, 1952, 1953, 1954, 1955, 1956, 1949, 1950, 1951,
+#> 1952, 1953, 1954, 1955, 1956, 1957, 1949, 1950, 1951, 1952, 1952, 1953, 1954, 1955, 1956, 1957, 1958, 1958, 1959, 1959, 1960, 1961, 1945, 1946, 1947, 1948, 1949, 1950, 1952, 1953, 1953, 1954, 1955, 1956, 1957, 1957, 1944, 1946, 1948, 1949, 1950, 1951, 1952, 1953, 1954, 1954, 1955, 1956, 1956, 1946, 1947, 1948, 1949, 1950, 1951, 1952, 1953, 1954, 1955, 1956, 1957, 1958, 1959, 1960, 1947, 1948, 1949, 1950, 1951, 1952, 1953, 1954, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1947, 1948,
+#> 1949, 1950, 1951, 1952, 1953, 1954, 1956, 1944, 1945, 1946, 1947, 1948, 1949, 1950, 1951, 1952, 1953, 1954, 1955, 1956, 1957, 1958, 1959, 1959, 1962, 1950, 1951, 1952, 1954, 1947, 1948, 1949, 1950, 1951, 1952, 1953, 1954, 1955, 1956, 1957, 1958, 1959, 1959, 1951, 1952, 1953, 1954, 1955, 1956, 1957, 1958, 1959, 1960, 1951, 1952, 1954, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1972, 1973, 1945, 1950, 1951, 1952, 1953, 1954, 1955, 1955,
+#> 1956, 1956, 1957, 1957, 1958, 1958, 1938, 1944, 1945, 1946, 1947, 1948, 1949, 1950, 1951, 1952, 1953, 1954, 1949, 1950, 1951, 1952, 1953, 1954, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1962, 1963, 1964, 1964, 1964, 1941, 1942, 1945, 1948, 1949, 1949, 1950, 1951, 1952, 1953, 1954, 1955, 1956, 1957, 1958, 1959, 1950, 1952, 1953, 1954, 1955, 1955, 1956, 1957, 1952, 1953, 1954, 1955, 1955, 1956, 1957, 1951, 1952, 1953, 1954, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966,
+#> 1967, 1968, 1948, 1949, 1950, 1951, 1952, 1953, 1954, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1965, 1966, 1966, 1949, 1950, 1951, 1952, 1953, 1954, 1950, 1951, 1952, 1953, 1955, 1956, 1957, 1957, 1958, 1959, 1960, 1961, 1961, 1947, 1948, 1949, 1950, 1951, 1952, 1953, 1954, 1955, 1956, 1952, 1953, 1954, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1965, 1966, 1966, 1953, 1954, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1945,
+#> 1946, 1947, 1948, 1949, 1950, 1951, 1952, 1953, 1954, 1955, 1956, 1956, 1957, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1948, 1949, 1950, 1951, 1951, 1952, 1953, 1954, 1955, 1956, 1957, 1958, 1958, 1959, 1959, 1959, 1952, 1953, 1954, 1955, 1956, 1957, 1959, 1954, 1955, 1956, 1957, 1958, 1958, 1959, 1960, 1960, 1960, 1962, 1954, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1947, 1948, 1949, 1950, 1951, 1952, 1953, 1954, 1955, 1956, 1957, 1958, 1959, 1959, 1960, 1961, 1949, 1950,
+#> 1951, 1952, 1953, 1954, 1955, 1956, 1957, 1958, 1959, 1959, 1959, 1948, 1949, 1950, 1953, 1954, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1961, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 1999, 1953, 1954, 1955, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1966, 1967, 1969, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1955, 1956, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1968, 1947, 1948, 1949, 1950, 1951, 1952, 1953, 1954, 1955, 1956, 1957, 1958, 1959, 1960,
+#> 1961, 1962, 1963, 1964, 1965, 1952, 1953, 1954, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1967, 1968, 1953, 1954, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1950, 1953, 1954, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1953, 1954, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1953, 1954, 1955, 1956,
+#> 1957, 1958, 1959, 1960, 1961, 1961, 1962, 1963, 1964, 1964, 1965, 1965, 1967, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1974, 1975, 1976, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1967, 1968, 1968, 1969, 1954, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967,
+#> 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1945, 1948, 1949, 1950, 1951, 1952, 1953, 1954, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1950, 1951, 1952, 1953, 1954, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1963, 1964, 1964, 1965, 1965, 1966, 1967, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1946, 1947, 1948, 1949, 1950, 1951, 1952, 1953, 1954, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1949, 1951, 1951, 1952, 1953, 1954,
+#> 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1976, 1980, 1951, 1952, 1953, 1954, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1964, 1965, 1966, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1965, 1966, 1967, 1967, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1969, 1970, 1971, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1967,
+#> 1968, 1951, 1953, 1954, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1963, 1954, 1955, 1956, 1957, 1958, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1964, 1964, 1965, 1954, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1950, 1952, 1953, 1954, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1963, 1963, 1964, 1965, 1966, 1967, 1956, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1967, 1968, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966,
+#> 1967, 1968, 1969, 1970, 1971, 1972, 1949, 1950, 1953, 1954, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1952, 1953, 1954, 1955, 1956, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1950, 1951, 1952, 1952, 1953, 1954, 1955, 1956, 1957, 1958, 1959, 1961, 1958, 1959, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1972, 1973, 1974, 1951, 1952, 1953, 1954, 1955, 1956,
+#> 1957, 1958, 1959, 1960, 1961, 1961, 1962, 1963, 1964, 1964, 1965, 1965, 1965, 1966, 1951, 1952, 1953, 1954, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1966, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1967, 1968, 1939, 1941, 1942, 1943, 1944, 1946, 1947, 1948, 1949, 1950, 1951, 1952, 1953, 1954, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1963, 1956, 1956, 1958, 1959, 1960, 1961, 1962, 1963, 1964,
+#> 1965, 1966, 1967, 1967, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1976, 1977, 1978, 1979, 1980, 1951, 1952, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1950, 1951, 1954, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970,
+#> 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1967, 1967, 1957, 1958, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1956, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1952, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1967, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967,
+#> 1968, 1968, 1969, 1970, 1971, 1972, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1972, 1973, 1954, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1964, 1965, 1966, 1967, 1967, 1959, 1960, 1961, 1962, 1963, 1964, 1964, 1965, 1966, 1952, 1953, 1954, 1955, 1956, 1956, 1957, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1963, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1968, 1969, 1970, 1971, 1972, 1973, 1974,
+#> 1975, 1960, 1961, 1962, 1963, 1964, 1966, 1967, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1954, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1964, 1964, 1965, 1965, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974,
+#> 1975, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1969, 1970, 1971, 1972, 1961, 1962, 1963, 1964, 1965, 1966, 1966, 1967, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1967, 1968, 1968, 1949, 1951, 1952, 1953, 1954, 1955, 1955, 1956, 1957,
+#> 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1964, 1965, 1966, 1967, 1953, 1954, 1955, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1966, 1955, 1956, 1957, 1959, 1960, 1961, 1962, 1963, 1952, 1953, 1954, 1956, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1968, 1969, 1956, 1957, 1957, 1958, 1959, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1966, 1967, 1956, 1957, 1958, 1959, 1960, 1961,
+#> 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1979, 1980, 1980, 1981, 1982, 1983, 1961, 1962, 1963, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1969, 1950, 1951, 1952, 1954, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1959, 1960, 1961, 1962, 1963, 1964, 1965,
+#> 1966, 1967, 1968, 1969, 1969, 1970, 1970, 1970, 1971, 1972, 1972, 1973, 1974, 1975, 1976, 1976, 1954, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1962, 1963, 1964, 1965, 1966, 1966, 1967, 1967, 1969, 1969, 1953, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1968, 1969, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976,
+#> 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1969, 1971, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1971, 1960, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971,
+#> 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1984, 1985, 1986, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1970, 1971, 1972, 1973, 1973, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1961, 1962, 1963, 1964, 1965,
+#> 1966, 1967, 1968, 1969, 1970, 1970, 1971, 1963, 1964, 1965, 1966, 1967, 1968, 1968, 1969, 1969, 1970, 1971, 1972, 1973, 1973, 1974, 1977, 1978, 1979, 1980, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1958, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1958, 1959,
+#> 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1966, 1969, 1954, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1973, 1974, 1975, 1976, 1977, 1977, 1978, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1974, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1961, 1962,
+#> 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1969, 1970, 1970, 1961, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1971, 1972, 1972, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1963, 1964, 1965, 1966, 1967, 1968, 1968, 1969, 1969, 1969, 1970, 1970, 1958, 1959, 1960, 1961,
+#> 1962, 1963, 1964, 1964, 1965, 1966, 1967, 1968, 1969, 1969, 1970, 1970, 1971, 1971, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1960, 1961, 1961, 1962, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1973, 1974, 1974, 1974, 1975, 1975, 1976, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1972, 1973,
+#> 1973, 1955, 1956, 1957, 1960, 1963, 1964, 1965, 1966, 1966, 1967, 1968, 1969, 1970, 1970, 1970, 1971, 1972, 1964, 1965, 1966, 1967, 1968, 1969, 1969, 1970, 1971, 1972, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1973, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1977, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977,
+#> 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1959, 1960, 1962, 1963, 1964, 1965, 1966, 1966, 1967, 1968, 1969, 1970, 1970, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1971, 1972, 1973, 1973, 1974, 1964, 1965, 1966, 1967, 1968, 1969, 1969, 1970, 1971, 1972, 1972, 1973, 1974, 1974, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1968, 1969, 1970, 1971, 1972, 1972, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976,
+#> 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1961, 1962, 1963, 1964, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1970, 1971, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1979, 1979, 1964, 1965, 1966, 1967, 1968, 1969,
+#> 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1979, 1980, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1986, 1959, 1960, 1961, 1963, 1964, 1965, 1966, 1967,
+#> 1968, 1969, 1970, 1971, 1972, 1972, 1973, 1974, 1974, 1975, 1975, 1976, 1977, 1978, 1979, 1980, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1977, 1965, 1966, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1966, 1967, 1968, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1978, 1979, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1972, 1966, 1967,
+#> 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1972, 1973, 1973, 1974, 1974, 1975, 1966, 1968, 1969, 1970, 1971, 1972, 1973, 1974,
+#> 1975, 1975, 1976, 1977, 1977, 1978, 1979, 1980, 1981, 1982, 1982, 1963, 1964, 1965, 1966, 1966, 1967, 1967, 1967, 1968, 1969, 1969, 1970, 1971, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1977, 1978, 1978, 1978, 1979, 1980, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1977, 1978, 1979, 1961, 1962, 1963, 1964, 1964, 1965, 1967, 1968,
+#> 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1959, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1977, 1978, 1978, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1955, 1956, 1957, 1959, 1960,
+#> 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1964, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1979, 1980, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1963, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972,
+#> 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1986, 1986, 1987, 1987, 1988, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1972, 1973, 1973, 1974, 1963, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1971, 1972, 1972, 1973, 1968, 1969, 1970, 1971, 1972, 1973, 1973, 1974, 1975, 1976, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1969,
+#> 1970, 1971, 1972, 1959, 1960, 1961, 1962, 1963, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1975, 1968, 1969, 1970, 1971, 1972, 1973, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1981, 1982, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1977, 1979, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1977, 1964, 1965, 1966, 1967, 1969, 1970,
+#> 1971, 1975, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1973, 1974, 1975, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1965, 1966, 1967, 1968, 1969, 1970, 1972, 1973, 1974, 1975, 1976, 1977, 1977, 1979, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1985, 1986, 1967, 1969, 1970, 1971, 1972,
+#> 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1978, 1979, 1980, 1981, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1975, 1976, 1979, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1971, 1972, 1973, 1974, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1988, 1970, 1971, 1972, 1973,
+#> 1974, 1975, 1976, 1976, 1977, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1965, 1966, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1979, 1980, 1981, 1982, 1983, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1965, 1966, 1967, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976,
+#> 1977, 1978, 1979, 1980, 1981, 1982, 1967, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1964, 1966, 1966, 1968, 1970, 1971, 1972, 1973, 1973, 1974, 1974, 1975, 1976, 1976, 1962, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1977, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981,
+#> 1982, 1983, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1975, 1976, 1977, 1978, 1979, 1980, 1980, 1981, 1982, 1983, 1983, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1969, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1975, 1975, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977,
+#> 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1985, 1986, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1985, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1965, 1967, 1968, 1969, 1971, 1972, 1973, 1973, 1974, 1974, 1974, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1984, 1984,
+#> 1985, 1986, 1987, 1988, 1989, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1980, 1981, 1982, 1982, 1964, 1965, 1966, 1967, 1968, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1977, 1978, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1979, 1980, 1981, 1983, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1968, 1970, 1971, 1972, 1973, 1974, 1975,
+#> 1976, 1977, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1983, 1984, 1984, 1985, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1978, 1979, 1980, 1965, 1966, 1967, 1968, 1969, 1970, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1987, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980,
+#> 1981, 1982, 1982, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1976, 1977, 1978, 1978, 1979, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1967, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986,
+#> 1967, 1969, 1970, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1976, 1977, 1977, 1978, 1979, 1980, 1981, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1968, 1969, 1970, 1971, 1972, 1973,
+#> 1974, 1975, 1976, 1977, 1978, 1979, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1976, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1974, 1975, 1976, 1977, 1978, 1979, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1973, 1974, 1975, 1976, 1977, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981,
+#> 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1984, 1985, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1985, 1986, 1987, 1987, 1964, 1965, 1966,
+#> 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1988, 1989, 1990, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1972, 1973, 1974, 1975, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1975, 1976, 1977, 1977, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1983, 1984,
+#> 1985, 1986, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1969, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1968, 1969,
+#> 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1984, 1985, 1985, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1991, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1989, 1991, 1992, 1993, 1994, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1969, 1970, 1971, 1971, 1972, 1973, 1974, 1975, 1976, 1977,
+#> 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1986, 1967, 1968, 1969, 1970, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1980, 1981, 1982, 1983, 1983, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1988, 1989, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1983, 1984, 1985, 1986, 1987, 1963, 1964, 1965,
+#> 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1982, 1983, 1984, 1985, 1985, 1986, 1987, 1988, 1989, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1982, 1983, 1984, 1985, 1985, 1986, 1987, 1988, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1974, 1975, 1976, 1977, 1977, 1978, 1978, 1979, 1980, 1981, 1976, 1977, 1978, 1979, 1980, 1974, 1975, 1976, 1977,
+#> 1977, 1978, 1976, 1977, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1968, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1993, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977,
+#> 1978, 1979, 1979, 1980, 1981, 1982, 1983, 1984, 1966, 1970, 1971, 1972, 1973, 1974, 1975, 1975, 1976, 1976, 1977, 1978, 1979, 1979, 1980, 1980, 1981, 1981, 1982, 1982, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1986, 1987, 1988, 1988, 1989, 1990, 1990, 1991, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987,
+#> 1988, 1989, 1990, 1971, 1972, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1987, 1988, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1996, 1997, 1997, 1976, 1977, 1978, 1979, 1980, 1981, 1982,
+#> 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1990, 1991, 1992, 1968, 1969, 1970, 1971, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1966, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983,
+#> 1984, 1986, 1987, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1981, 1983, 1984, 1985, 1986, 1987, 1987, 1988, 1989, 1990, 1991, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1991, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1982, 1983, 1984, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983,
+#> 1984, 1985, 1986, 1987, 1988, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1984, 1985, 1986, 1986, 1987, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1981, 1982, 1983, 1985, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980,
+#> 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1987, 1987, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1988, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1975, 1976,
+#> 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1987, 1988, 1989, 1990, 1991, 1992, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1988, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1985, 1986, 1987, 1988, 1988, 1989,
+#> 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1983, 1984, 1985, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1990, 1990, 1991, 1992, 1993, 1994, 1995, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1987, 1988, 1973, 1974, 1975, 1976, 1976, 1977, 1978, 1979, 1981, 1982,
+#> 1983, 1984, 1985, 1986, 1987, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1982, 1983, 1984, 1984, 1985, 1986, 1979, 1980, 1981, 1982, 1983, 1984, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1976, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1970, 1971, 1972, 1973,
+#> 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1975, 1976, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1982, 1983, 1984, 1984, 1985, 1986, 1987, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1977, 1977, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1983, 1984, 1985, 1985, 1986, 1967, 1968, 1969, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1985, 1986, 1987, 1987,
+#> 1988, 1965, 1966, 1967, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1990, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988,
+#> 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1975, 1976, 1977, 1977, 1978, 1979, 1980, 1981, 1982, 1982, 1983, 1984, 1985, 1985, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1988, 1989, 1990, 1980, 1981, 1982, 1980, 1981, 1982, 1983, 1985, 1985, 1987, 1991,
+#> 1992, 1993, 1994, 1995, 1996, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1992, 1993, 1994, 1995, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1985, 1986, 1987, 1988, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1988, 1989, 1975, 1976, 1977, 1978, 1979, 1980,
+#> 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1972, 1973, 1973, 1974, 1975, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1983, 1984, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1987, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1993, 1994, 1995, 1996, 1997, 1997, 1975, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1979,
+#> 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1989, 1990, 1991, 1992, 1993, 1993, 1994, 1995, 1996, 1997, 1997, 1998, 1999, 2000, 2000, 2001, 2002, 2003, 1971, 1972, 1973, 1974, 1975, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1979, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1994, 1995, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983,
+#> 1984, 1985, 1986, 1987, 1988, 1989, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1988, 1989, 1990, 1991, 1992, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1985, 1986, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1990, 1991, 1992,
+#> 1993, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1988, 1989, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1987, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1988, 1989, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987,
+#> 1987, 1988, 1989, 1990, 1991, 1992, 1992, 1973, 1974, 1975, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1973, 1974, 1975, 1976, 1978, 1979, 1980, 1981, 1982, 1983, 1983, 1984, 1985, 1986, 1986, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1998, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1993, 1994, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985,
+#> 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1988, 1989, 1990, 1991, 1992, 1993, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1982, 1983, 1984, 1985, 1986, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1996, 1997, 1980, 1981, 1982, 1983, 1984, 1985,
+#> 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1997, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 1974, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1984, 1985, 1986, 1987, 1988, 1977, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1985, 1985, 1986, 1987, 1982, 1983, 1984, 1985, 1986, 1986, 1987, 1988, 1989, 1990, 1990, 1991, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996,
+#> 1997, 1998, 1999, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1987, 1988, 1989, 1990, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1979, 1980, 1981, 1982, 1983, 1984, 1985,
+#> 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1978, 1979, 1980, 1981, 1982, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1989, 1990, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2001, 2001, 2002, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1990, 1991, 1992, 1993, 1993, 1994, 1995, 1996, 1996, 1997, 1979, 1980, 1981, 1982,
+#> 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1976, 1977, 1978, 1979, 1980, 1981, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1996, 1997, 1998, 1999, 2000, 2000, 2000, 1982, 1983, 1984, 1985, 1986, 1987,
+#> 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1983, 1984, 1985, 1986, 1986, 1987, 1988, 1989, 1990, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1995, 1997, 1998, 1999, 2001, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1992, 1980, 1981,
+#> 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1996, 1979, 1980, 1981, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1992, 1993, 1994, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1998, 1999, 2000, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1995, 1996, 1997, 1981, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1980, 1981, 1982, 1983, 1984, 1985, 1986,
+#> 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1989, 1990, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1997, 1998, 1999, 1999, 2000, 2000, 2001, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1990, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1988, 1989, 1990, 1990, 1991, 1991, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1988, 1989, 1990, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1984,
+#> 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1993, 1994, 1995, 1996, 1997, 1998, 1998, 1999, 2000, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1989, 1990, 1991, 1992, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1983,
+#> 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1993, 1994, 1995, 1997, 1998, 1999, 2001, 2001, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1988, 1989, 1990, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1985, 1986, 1985, 1986, 1987, 1988, 1989, 1992, 1993, 1994, 1995, 1996, 1997, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2000, 2001, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1979, 1980, 1981,
+#> 1982, 1983, 1983, 1984, 1985, 1986, 1987, 1987, 1991, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1990, 1991, 1992, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1993, 1994, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1989, 1990, 1991, 1993, 1994, 1995, 1984, 1985, 1986, 1987, 1988, 1989, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 1984, 1985, 1986, 1987,
+#> 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1996, 1997, 1998, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1993, 1994, 1995, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1993, 1994, 1996, 1997, 1998, 1999, 2000, 2001, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1977, 1978, 1979, 1980, 1981, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1988, 1989, 1990, 1986, 1987, 1988, 1989,
+#> 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1997, 1998, 1999, 2000, 2001, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 1985, 1986, 1987, 1988, 1989, 1990, 1990, 1991, 1992, 1993, 1994, 1995, 1995, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1989, 1990, 1991, 1992, 1992, 1993, 1994, 1995, 1995, 1996, 1997, 1998, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1984, 1985, 1986, 1987,
+#> 1988, 1989, 1989, 1990, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1985, 1986, 1987, 1988,
+#> 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1995, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2003, 2004, 2005, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1995,
+#> 1996, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1996, 1997, 1997, 1999, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2007, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 2000, 2001, 2001, 2002, 2003, 2004, 1986, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1995, 1996, 1997, 1998, 1998, 1999, 2000, 2001, 1981, 1983, 1984, 1985, 1986, 1987, 1988,
+#> 1989, 1989, 1990, 1991, 1992, 1992, 1993, 1994, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 1976, 1977, 1978, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1978, 1981, 1982, 1983, 1983, 1984, 1985, 1985, 1986, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2000, 1983, 1984, 1985, 1986, 1987, 1988, 1989,
+#> 1990, 1991, 1992, 1992, 1993, 1994, 1995, 1996, 1997, 1997, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1986, 1987, 1988, 1989, 1990, 1991, 1993, 1994, 1980, 1981, 1983, 1984, 1985, 1986, 1987, 1987, 1988, 1989, 1990, 1991, 1992, 1992, 1993, 1993, 1994, 1997, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1991, 1991, 1992, 1993, 1994, 1995, 1982, 1983, 1984, 1985, 1986, 1987, 1987, 1988, 1989, 1984, 1986, 1987, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1996,
+#> 1996, 1997, 1998, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1992, 1993, 1994, 1994, 1995, 1996, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1995, 1996, 1996, 1997, 1997, 1998, 1999, 2000, 2001, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2001, 2002, 2003, 2004, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1986, 1987, 1988,
+#> 1989, 1990, 1991, 1992, 1992, 1993, 1994, 1995, 1995, 1996, 1996, 1997, 1997, 1998, 2000, 2001, 2002, 2003, 2003, 2004, 2005, 2006, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2002, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994,
+#> 1995, 1996, 1997, 1997, 1998, 1998, 1999, 1999, 2000, 2001, 2002, 1984, 1985, 1986, 1987, 1988, 1989, 1989, 1990, 1991, 1992, 1992, 1993, 1994, 1994, 1995, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2002, 2003, 2004,
+#> 2005, 2006, 2006, 2007, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2008, 2009, 2010, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001,
+#> 2002, 2003, 2004, 2005, 2006, 2006, 2007, 2008, 2008, 1983, 1984, 1985, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1988, 1989, 1990, 1991, 1992, 1993, 1995, 1995, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1998, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1993, 1994, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2000, 2001, 2002, 1985, 1986, 1987, 1988, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1996, 1997, 1998,
+#> 1998, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 2001, 2002, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2003,
+#> 2004, 2004, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2003, 2004, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2003, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998,
+#> 1999, 2000, 2001, 2002, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2008, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1998, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1995, 1996, 1997, 1998, 1999, 2000, 2000, 2001, 2001, 2002, 2003, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1995, 1996, 1998,
+#> 1999, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2008, 2009, 2009, 2010, 2011, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1995, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2004, 2005, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2001, 2002, 2003, 2004,
+#> 2005, 2006, 2007, 2008, 2009, 2009, 1992, 1993, 1994, 1995, 1996, 1997, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 1988, 1989, 1990, 1991, 1992, 1993, 1993, 1994, 1995, 1996,
+#> 1997, 1998, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 1983, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1997, 1991, 1992, 1993, 1994, 1995, 1995, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1995, 1996, 1997, 1998, 1987, 1988, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 1982, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1996, 1997, 1998, 1998, 1999, 2000, 1988, 1989, 1990, 1991, 1992, 1993,
+#> 1994, 1995, 1995, 1996, 1996, 1996, 1997, 1998, 1999, 1999, 2001, 2002, 2003, 2004, 2004, 2005, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2002, 2003, 2003, 2004, 2005, 2006, 2007, 2007, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1996, 1997, 1998,
+#> 1999, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2004, 2005, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995,
+#> 1996, 1997, 1998, 1999, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2006, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1998, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1996, 1997, 1998, 1999, 1999, 2002, 2003, 2004, 2005, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1997, 1998, 1998, 1999, 2000, 2000, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 1985, 1986,
+#> 1987, 1988, 1989, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1992, 1993, 1994, 1995, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2003, 1990, 1991, 1992, 1993, 1994, 1995, 1995, 1996, 1997, 1997, 1998, 1999, 2000, 2001, 2002, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 1999, 2000, 2001, 2003, 2004, 1993, 1994, 1995, 1996, 1997, 1998, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2002, 2003, 2003, 2004, 2004, 2005, 1990, 1990, 1992,
+#> 1993, 1994, 1995, 1996, 1997, 1998, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1995, 1996, 1997, 1998, 1999, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2000, 2001, 2002, 2002, 2003, 2004, 2005, 1990, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2003, 2004, 2005, 2006, 2006, 2007, 2007, 1988, 1989, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1998, 1999, 2000, 2001, 2002,
+#> 2003, 2004, 2005, 2006, 2007, 2008, 2009, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2008, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2001, 1994, 1995, 1996, 1997, 1998, 1998, 1999, 2000, 2000, 2001, 2002, 2003, 2004, 2005, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2004, 2005, 2006, 2007, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2002,
+#> 2003, 1987, 1990, 1991, 1992, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2007, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 1995, 1996, 1997, 1998, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2008, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2008, 2009, 2010, 2010, 2011, 1992, 1993, 1994, 1995,
+#> 1996, 1997, 1998, 1999, 2000, 2001, 2002, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2001, 2002, 2003, 2004, 2005, 2006, 2006, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2000, 2001, 1989, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2007, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2009, 2010, 2011, 2011, 2012, 2012,
+#> 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2008, 2010, 2010, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1998, 1999, 2000, 2001, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 1981, 1982,
+#> 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1995, 1996, 1997, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 1987, 1988, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2006, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997,
+#> 1998, 1999, 2000, 2001, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 1995, 1996, 1997, 1998, 1999, 2000, 2000, 2001, 2002, 2002, 2003, 2004, 2005, 2005, 2006, 2006, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2015, 1992, 1993, 1994, 1995, 1996, 1997, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2003, 2004, 2005, 2006, 2006, 1995, 1996, 1997, 1998, 1999,
+#> 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2012, 2013, 1987, 1988, 1989, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2005, 1993, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998,
+#> 1999, 2000, 2001, 2002, 2003, 2004, 2005, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 1996, 1997, 1998, 1999, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2006, 2007, 2008, 2008, 2009, 2009, 2010, 2011, 2012, 2012, 1990, 1991, 1992, 1993, 1994, 1995, 1995, 1996, 1997, 1998, 1998, 1999, 2000, 2001, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2004, 2005, 2006, 2007, 2008, 2009, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2009, 2010,
+#> 2011, 2012, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 1991, 1992, 1993, 1994, 1995, 1996, 1996, 1997, 1998, 1999, 2000, 2000, 2001, 2002, 2003, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004,
+#> 2005, 2006, 2006, 2007, 2007, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2005, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2001, 2002, 2003, 2003, 2004, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2001, 2002, 2002, 2003, 2004, 2005, 2006, 2007, 2008,
+#> 2009, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2004, 2005, 1998, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2010, 2011, 2012, 1992, 1993, 1994, 1995, 1996, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 1989, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 1986, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995,
+#> 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 1998, 1999, 2000, 2001, 2002, 2004, 2005, 2006, 2006, 2007, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2006, 2007, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2006, 2007, 2008, 1993, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006,
+#> 2007, 2008, 2009, 2010, 2011, 2012, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2009, 2010, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2011, 2012, 2013, 2014, 2015, 1999, 2000, 2001, 2002, 2003, 2003, 2004, 2005, 2006, 2006, 2007, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 1995, 1996,
+#> 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2006, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2008, 2009, 2010, 1986, 1987, 1988, 1989, 1990, 1991, 1993, 1994, 1995, 1996, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2006, 2007, 2008, 2009, 2010, 2012, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2001, 2002, 2003, 2004, 2005, 2006,
+#> 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2001, 2002, 2003, 2003, 2004, 2005, 2005, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1998, 1999, 2000, 2002, 1996, 1997, 1998, 1999, 2000, 2001, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 1994, 1995, 1996, 1997, 1998,
+#> 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 1996, 1997, 1998, 1999, 2000, 2001, 2001, 2002, 2003, 2004, 2004, 2005, 2006, 2006, 2007, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2009, 2010, 2011, 2012, 2013, 2014, 1992, 1992, 1993, 1994, 1995, 1996, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 1993, 1994, 1995, 1996,
+#> 1997, 1998, 1999, 2000, 2001, 2001, 2002, 2003, 2003, 2004, 2004, 2005, 2006, 2007, 2008, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2000, 2001, 2002, 2003, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2011, 2012, 2014, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005,
+#> 2006, 2007, 2008, 2009, 2010, 2011, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2004, 2005, 2006, 2007, 2008, 2009, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2011, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010,
+#> 2011, 2012, 2013, 2014, 2015, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2012, 2013, 2014, 2015, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 1993, 1994, 1995, 1996, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2004, 2005, 2006, 2007, 2008, 2009, 2009, 2010, 2011, 2011, 1995, 1997, 1997, 1998, 1999, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007,
+#> 2008, 2009, 2010, 2011, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2003, 2003, 2004, 2005, 2006, 2007, 2007, 2008, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 1990, 1991, 1992, 1993, 1994, 1995, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2004, 2005, 2006, 2007, 2008, 2009, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 1993, 1993,
+#> 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 1969, 1971, 1972, 1973, 1974, 1975, 1975, 1976, 1977, 1977, 1978, 1979, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2015, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2010, 1996, 1997, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2005, 2006, 1997, 1998, 1999, 2000, 2001, 2002, 2003,
+#> 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2010, 2011, 2013, 1999, 2000, 2001, 2002, 2003, 2004, 2004, 2002, 2003, 2004, 2005, 2006, 2006, 2007, 2008, 2009, 2009, 2010, 2011, 2012, 2013, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2013, 2014, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 1997, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005,
+#> 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2012, 2013, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2012, 2013, 2014, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2007, 2008, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2010, 2011, 2011, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2007, 2008, 2009, 2010,
+#> 1997, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2005, 2005, 2006, 2007, 2008, 1997, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2008, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2009, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2010, 2011, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2002, 2003, 2004, 2005, 2006, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006,
+#> 2007, 2008, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2008, 2009, 2010, 2011, 2012, 2012, 2014, 2015, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2012, 2001, 2002, 2003, 2004, 2005, 2006, 2006, 2007, 2007, 2008, 2009, 2010, 2011,
+#> 2012, 2012, 2013, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2010, 2003, 2003, 2004, 2005, 2006, 2007, 2008, 2008, 2009, 2010, 2011, 2012, 2013, 2003, 2004, 2005, 2006, 2007, 2007, 2008, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 1999, 2000, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2009, 2010, 2011, 2013, 2014, 2015, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009,
+#> 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2012, 2014, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2009, 2010, 2011, 2011, 2012, 1997, 1998, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 1998, 1999, 2000, 2001, 2002,
+#> 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 1995, 1996, 1996, 1997, 1998, 1999, 2000, 2001, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2009, 1999, 2000, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2011, 2012, 2013, 2014, 2015, 1997, 1998, 1999, 2000, 2001, 2002, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2011, 2012, 2013, 2014, 2015, 1997, 1998, 1999, 2000, 2001, 2002, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011,
+#> 2012, 2012, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2010, 2011, 2012, 2013, 2003, 2004, 2005, 2006, 2007, 2008, 2010, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2014, 2015, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2000, 2002, 2003, 2004, 2005, 2006, 2007, 2007, 2008, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2007, 2008, 2009,
+#> 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2012, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2011, 2012, 2012, 2013, 2015, 2001, 2002, 2003, 2004, 2005, 2006, 2006, 2007, 2008, 2008, 2009, 2009, 2010, 2010, 2011, 2011, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002,
+#> 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2013, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2004, 2005, 2006, 2007, 2008, 2008, 1998, 1999, 2000, 2001, 2002, 2002, 2003, 2004, 2005, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2008, 2009, 2010, 1954, 1955, 1956, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2014, 2015, 2015, 2003, 2004,
+#> 2005, 2006, 2007, 2008, 2009, 1995, 1996, 1997, 1998, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2010, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2013, 2014, 2015, 1995, 1996, 1997, 1998, 1998, 1999, 2000, 2001, 2002, 2003, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2010, 2012, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2011, 2012, 2013, 2013, 2014, 2015, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2005, 2006,
+#> 2007, 2008, 2009, 2010, 2011, 2012, 2012, 2013, 2014, 2015, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2015, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2004, 2005, 2006, 2007, 2008, 2009, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2001, 2002, 2003,
+#> 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2015, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2010, 2011, 2012, 2013, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2015, 2001, 2002, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2013, 2014, 1996, 1997, 1998, 1999, 2000,
+#> 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2009, 2010, 2011, 2012, 2013, 2013, 2014, 2014, 2015, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2012, 2013, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2014, 2014, 2015, 2015, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2005, 2006, 2007, 2008, 2009, 2009, 2010, 2010, 2011, 2012,
+#> 2013, 2013, 2014, 2015, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2010, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1997, 1998, 1999, 2000, 2000, 2001, 2002, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2003, 2004, 2005, 2006,
+#> 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2007, 2008, 2008, 2009, 2010, 2011, 2012, 1995, 1996, 1997, 1997, 1998, 2001, 2002, 2003, 2004, 2005, 2005, 2006, 2007, 2008, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2013, 2014, 2015, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2015, 2002, 2003,
+#> 2004, 2005, 2006, 2007, 2008, 2009, 2009, 2010, 2010, 2011, 2012, 2013, 2014, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2012, 2013, 2014, 2015, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2005, 2006, 2007, 2008, 2009, 2009, 2010, 2011, 2012, 2012, 2013, 2014,
+#> 2003, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2012, 2013, 2014, 2015, 2015, 1998, 1999, 2000, 2001, 2002, 2003, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2015, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2014, 2015, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2012, 2013, 2014, 2014, 2015, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2006, 2007, 2008, 2009, 2009, 2010, 2011, 2012, 2007, 2008, 2009,
+#> 2010, 2011, 2012, 2013, 2014, 2015, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2002, 2003, 2003, 2004, 2005, 2007, 2008, 2009, 2010, 2010, 2011, 2011, 2012, 2013, 2014, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2011, 2012, 2013, 2014, 2015, 2011, 2012, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2012, 2013, 2014, 2015, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2000, 2001, 2002,
+#> 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2006, 2007, 2008, 2009, 2010, 2011, 2011, 2012, 2013, 2014, 2015, 2015, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2005, 2006, 2007, 2008, 2009, 2010, 2012, 2013, 2014, 2015, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2011, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2009, 2010, 2011, 2012, 2013, 2015, 2009, 2010, 2011,
+#> 2012, 2013, 2014, 2015, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 1999, 2001, 2002, 2003, 2004, 2005, 2006, 2006, 2007, 2008, 2009, 2010, 2011, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2005, 2006, 2008, 2009, 2010, 2011, 2012, 2012, 2013, 2014, 2015, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013,
+#> 2014, 2015, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2015, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2015, 2004, 2004, 2004, 2004, 2005, 2006, 2007, 2008, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2003, 2005, 2006, 2006, 2006, 2007, 2008, 2009, 2010, 2010, 2011, 2012, 2013,
+#> 2014, 2015, 1992, 1993, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2015, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2014, 2015, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2005, 2006, 2007, 2008, 2009, 2010,
+#> 2011, 2012, 2013, 2014, 2015, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2009, 2010, 2011, 2012, 2013, 2014, 2014, 2015, 2015, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2009,
+#> 2010, 2011, 2012, 2013, 2013, 2014, 2014, 2015, 2010, 2011, 2012, 2013, 2014, 2015, 2010, 2011, 2012, 2013, 2014, 2015, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2014, 2015, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2009, 2010, 2010, 2011, 2012, 2014, 2015, 2006, 2007, 2008, 2009, 2010, 2011, 2011, 2012, 2013, 2013, 2014, 2015, 2005, 2006, 2007, 2008, 2009, 2010, 2011,
+#> 2012, 2013, 2014, 2015, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2001, 2003, 2004, 2005, 2006, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2002, 2003, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2015, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2014, 2015, 2015, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2004, 2005, 2006, 2007, 2008, 2009, 2009, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2010, 2011, 2012,
+#> 2013, 2014, 2014, 2015, 2015, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2014, 2015, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2010, 2011, 2012, 2013, 2014, 2015, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2012, 2013, 2014, 2011, 2012, 2013, 2014, 2015, 2012, 2013, 2014, 2015, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2014, 2015, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2014, 2006, 2007,
+#> 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2010, 2011, 2012, 2013, 2014, 2015, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2009, 2010, 2011, 2011, 2012, 2013, 2014, 2015, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2011, 2012, 2013, 2014, 2015, 2012, 2013, 2014, 2015, 2011, 2012, 2013, 2014, 2015, 2011, 2012, 2013, 2014, 2015, 2013, 2014, 2015, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2015, 2012, 2013, 2014, 2015, 2013, 2014, 2015, 2013, 2014, 2015, 2013, 2014, 2015, 2008, 2009,
+#> 2010, 2011, 2011, 2012, 2013, 2014, 2015, 2011, 2012, 2013, 2014, 2015, 2010, 2011, 2012, 2013, 2014, 2015, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2010, 2011, 2012, 2013, 2014, 2015, 2011, 2012, 2013, 2014, 2015, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2014, 2015, 2008, 2009, 2010, 2011, 2012, 2012, 2014, 2015, 2015, 2011, 2012, 2013, 2014, 2015, 2011, 2012, 2013, 2014, 2015, 2012, 2013, 2014, 2015, 2011, 2012, 2013, 2014, 2015, 2013,
+#> 2014, 2015, 2013, 2014, 2015, 2010, 2011, 2012, 2013, 2014, 2015, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2014, 2015, 2014, 2015, 2011, 2012, 2013, 2014, 2015, 2012, 2013, 2014, 2015, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2013, 2014, 2015, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2012, 2013, 2015, 2010, 2011, 2012, 2013, 2013, 2014, 2015, 2013, 2014, 2015, 2012, 2013, 2014, 2014, 2015, 2015, 2012, 2013, 2014, 2015, 2011, 2012, 2013, 2014, 2015,
+#> 2012, 2013, 2014, 2015, 2012, 2013, 2014, 2015, 2011, 2012, 2013, 2014, 2015, 2010, 2012, 2013, 2014, 2015, 2008, 2009, 2011, 2012, 2013, 2014, 2015, 2015, 2015, 2006, 2007, 2008, 2009, 2010, 2012, 2013, 2014, 2014, 2015, 2011, 2012, 2013, 2014, 2015, 2013, 2014, 2015) x c(18, 59, 57, 26, 26, 26, 26, 26, 139, 28, 61, 143, 144, 32, 32, 35, 35, 107, 107, 107, 107, 107, 107, 107, 107, 147, 147, 62, 62, 26, 106, 148, 74, 74, 74, 74, 74, 74, 74, 74, 106, 6, 107, 107, 107, 107, 107, 26, 26, 26, 26, 27, 38, 89, 121, 121, 121, 121, 121, 121, 36, 121, 38, 135, 135, 135, 92, 92, 89, 89, 89, 89, 89, 95, 89, 102, 102, 102, 139, 35, 35, 35, 35, 26, 26, 26, 26, 26, 42, 42, 42, 62, 89, 89, 89, 89, 89, 89, 89, 89, 38, 35, 35, 36, 25, 26, 26, 26, 26, 26, 26, 26, 26, 26, 84, 102,
+#> 102, 102, 42, 42, 42, 42, 42, 42, 42, 42, 42, 125, 125, 16, 16, 16, 16, 16, 16, 16, 16, 45, 45, 26, 45, 102, 102, 102, 102, 102, 101, 45, 101, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 101, 101, 75, 75, 106, 35, 106, 101, 101, 101, 101, 101, 101, 123, 123, 123, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 38, 89, 93, 93, 93, 93, 93, 93, 93, 93, 33, 93, 29, 33, 29, 38, 38, 38, 89, 16, 16, 16, 16, 33, 33, 33, 33, 33, 29, 42, 42, 42, 125, 125, 16, 16, 16, 16, 16, 16, 16, 16,
+#> 123, 93, 123, 26, 26, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 52, 38, 38, 38, 38, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 16, 123, 123, 123, 123, 123, 123, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 26, 45, 45, 45, 45, 45, 45, 45, 45, 45, 137, 22, 22, 22, 22, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 93, 93, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 101, 101, 42, 42, 42, 42, 42, 125, 125, 125, 123, 123, 123,
+#> 123, 123, 123, 123, 123, 123, 123, 123, 123, 123, 123, 123, 125, 125, 89, 89, 89, 89, 89, 89, 89, 89, 26, 26, 137, 35, 12, 12, 89, 89, 89, 89, 89, 89, 89, 125, 125, 125, 125, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 26, 35, 26, 38, 125, 125, 12, 38, 38, 38, 89, 89, 89, 89, 26, 89, 106, 89, 75, 75, 75, 75, 75, 75, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 125, 35, 35, 35, 35, 35, 35, 35, 35, 35, 38, 21, 124, 34, 35, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22,
+#> 75, 75, 75, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 26, 26, 26, 26, 26, 26, 26, 26, 26, 26, 26, 26, 26, 26, 89, 89, 26, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 26, 26, 26, 26, 102, 33, 26, 26, 26, 26, 26, 26, 26, 26, 26, 106, 106, 106, 106, 125, 35, 35, 35, 35, 35, 35, 35, 35, 22, 35, 22, 87, 26, 26, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 106, 102, 106, 140, 101, 101, 101, 101, 101, 101, 101, 101, 101, 33, 33, 33, 33, 33, 33,
+#> 33, 33, 33, 33, 33, 33, 101, 101, 101, 101, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 38, 26, 38, 38, 140, 140, 140, 140, 93, 125, 16, 16, 16, 16, 16, 16, 16, 16, 16, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 140, 101, 101, 101, 101, 101, 101, 101, 101, 101, 101, 101, 101, 101, 101, 101, 124, 123, 123, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 140, 63, 87, 16, 16, 16, 16, 16, 16, 16, 16,
+#> 45, 45, 45, 45, 45, 45, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 140, 140, 140, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 89, 89, 125, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 93, 93, 75, 75, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 35, 106, 35, 35, 38, 106, 106, 106, 106, 106, 106, 106, 106, 106, 102, 106, 109, 109, 106, 35, 35, 35, 35,
+#> 35, 35, 35, 35, 35, 106, 106, 21, 29, 35, 93, 93, 93, 52, 101, 101, 101, 101, 101, 101, 101, 93, 93, 93, 93, 93, 93, 93, 93, 106, 101, 101, 101, 101, 101, 101, 101, 101, 101, 22, 22, 22, 22, 52, 101, 101, 101, 101, 101, 101, 101, 101, 101, 101, 101, 101, 13, 102, 102, 33, 106, 52, 35, 35, 35, 35, 35, 35, 35, 35, 35, 22, 38, 106, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 26, 26, 26, 38, 38, 38, 35, 35, 35, 35, 106, 93, 93, 101, 101, 101, 101, 101, 101, 101, 93, 93, 93, 93, 93, 93, 38,
+#> 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 45, 45, 45, 16, 45, 16, 16, 101, 140, 101, 101, 45, 45, 45, 45, 45, 33, 45, 33, 33, 33, 33, 33, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 38, 89, 89, 89, 89, 89, 89, 89, 89, 89, 22, 22, 26, 102, 102, 102, 102, 102, 102, 102, 35, 35, 35, 35, 35, 35, 35, 35, 35, 125, 125, 125, 125, 102, 22, 22, 22, 22, 22, 22, 22, 22, 22, 38, 38, 38, 38, 38, 38, 89, 89, 89, 89, 89, 89, 89, 89, 89, 35, 89, 35, 89, 89, 89, 106, 35, 38, 38, 38,
+#> 38, 38, 102, 102, 102, 102, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 22, 89, 22, 22, 22, 22, 22, 38, 26, 26, 26, 26, 101, 101, 101, 101, 101, 101, 101, 101, 101, 16, 16, 16, 16, 45, 26, 26, 106, 106, 102, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 101, 45, 45, 45, 45, 45, 45, 140, 140, 140, 140, 140, 140, 140, 140, 140, 52, 52, 52, 125, 125, 22, 125, 89, 89, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 89, 89, 89, 89, 38, 38, 38, 38, 102, 102, 102, 102, 102, 102,
+#> 102, 35, 35, 35, 38, 106, 106, 106, 106, 106, 106, 125, 125, 125, 89, 89, 89, 89, 89, 89, 89, 101, 101, 101, 101, 101, 16, 16, 16, 93, 93, 93, 93, 93, 123, 123, 123, 123, 101, 52, 106, 140, 140, 140, 45, 140, 45, 45, 45, 45, 63, 21, 87, 101, 101, 101, 101, 101, 101, 101, 101, 16, 101, 16, 16, 16, 106, 106, 106, 106, 106, 16, 33, 140, 102, 102, 102, 102, 102, 102, 102, 102, 102, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 101, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33,
+#> 33, 33, 33, 33, 33, 33, 89, 16, 16, 16, 16, 16, 16, 52, 52, 52, 52, 52, 26, 26, 26, 26, 26, 26, 26, 26, 26, 106, 106, 106, 106, 35, 22, 125, 125, 26, 26, 26, 26, 26, 26, 125, 125, 125, 125, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 38, 38, 38, 102, 26, 26, 26, 26, 93, 93, 93, 93, 93, 123, 33, 33, 33, 33, 33, 33, 33, 33, 33, 89, 38, 89, 38, 38, 38, 38, 38, 38, 38, 38, 89, 89, 89, 89, 89, 106, 125, 125, 125, 125, 125, 125, 125, 89, 125, 89, 89,
+#> 89, 89, 89, 89, 89, 125, 102, 102, 102, 102, 102, 89, 102, 89, 89, 89, 26, 26, 26, 26, 22, 22, 89, 35, 35, 35, 35, 35, 35, 35, 106, 35, 35, 35, 35, 35, 35, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 106, 106, 106, 106, 106, 22, 22, 22, 22, 22, 22, 93, 123, 123, 123, 123, 123, 123, 123, 123, 123, 123, 123, 123, 26, 140, 26, 26, 16, 16, 16, 16, 16, 16, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 26, 89, 89, 26, 26, 89, 89, 89, 38, 38, 38, 89, 89, 26, 26, 35, 35,
+#> 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 89, 26, 35, 35, 35, 35, 123, 125, 123, 123, 123, 123, 89, 26, 89, 26, 26, 26, 26, 26, 26, 26, 26, 26, 26, 26, 89, 89, 89, 26, 26, 89, 89, 89, 89, 89, 35, 89, 35, 35, 106, 89, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 52, 16, 16, 16, 16, 16, 33, 33, 33, 33, 33, 33, 33, 33, 33, 45, 45, 45, 45, 45, 45, 45, 45, 45, 123, 123, 102, 102, 102, 102, 102, 102, 102, 35, 35, 35, 35, 33, 63, 87, 38, 89, 38, 38, 38, 38, 38, 38, 38, 38,
+#> 38, 38, 89, 89, 89, 38, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 22, 106, 22, 22, 22, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 35, 35, 52, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 16, 93, 123, 123, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 33, 33, 33, 33, 33, 93, 93, 93, 93, 140, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 22, 22, 22, 22, 22, 22, 106, 106, 106, 106, 52, 52, 106, 106, 22, 22, 22, 22,
+#> 22, 22, 22, 22, 22, 89, 106, 106, 26, 125, 125, 35, 35, 125, 93, 106, 125, 45, 45, 45, 93, 93, 93, 93, 93, 93, 93, 93, 93, 140, 140, 140, 140, 140, 33, 89, 89, 102, 102, 102, 102, 125, 125, 125, 125, 125, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 125, 125, 38, 125, 125, 26, 26, 26, 89, 89, 89, 89, 89, 26, 89, 26, 26, 22, 22, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 45, 38, 45, 45, 45, 45, 45, 45, 45, 106, 101, 45, 45, 45, 45, 45,
+#> 45, 45, 45, 45, 140, 140, 140, 93, 93, 93, 123, 123, 123, 123, 123, 123, 123, 93, 93, 93, 93, 16, 16, 16, 16, 16, 16, 16, 16, 93, 93, 93, 93, 140, 33, 38, 106, 106, 106, 106, 106, 106, 106, 106, 106, 125, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 16, 16, 16, 16, 16, 93, 93, 93, 93, 93, 38, 38, 38, 38, 38, 89, 89, 89, 89, 89, 89, 89, 89, 89, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 89, 89, 89, 106, 89, 89,
+#> 89, 89, 89, 89, 89, 89, 38, 38, 38, 35, 38, 22, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 26, 26, 26, 26, 26, 89, 89, 89, 89, 89, 89, 89, 38, 89, 35, 38, 35, 35, 101, 101, 101, 101, 101, 16, 93, 93, 93, 93, 93, 93, 93, 26, 52, 101, 101, 101, 101, 101, 101, 16, 16, 16, 16, 93, 93, 93, 123, 106, 140, 89, 106, 101, 101, 101, 101, 101, 101, 101, 101, 101, 101, 101, 101, 101, 101, 102, 102, 102, 102, 102, 102, 102, 102, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 35, 38, 38, 38, 38,
+#> 22, 22, 22, 22, 140, 93, 140, 93, 52, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 38, 38, 38, 101, 101, 101, 101, 101, 101, 101, 101, 101, 101, 101, 101, 101, 101, 101, 93, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 38, 38, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 52, 52, 52, 52, 52, 89, 93, 93, 45, 29, 52, 52, 52, 52, 52, 52, 16, 16, 16, 16, 101, 101, 101, 101, 101, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 93, 93, 93, 101, 125, 106, 106, 106, 106, 106, 106, 35, 35, 35, 35,
+#> 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 125, 125, 125, 89, 125, 89, 89, 89, 89, 125, 35, 38, 125, 26, 26, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 22, 22, 89, 89, 89, 89, 106, 106, 106, 106, 106, 106, 106, 106, 22, 22, 93, 106, 93, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 125, 38, 125, 22, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 16, 22, 16, 45, 45, 52, 52, 52, 52, 52, 52, 52, 140, 140, 101, 140, 101, 45,
+#> 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 33, 123, 33, 33, 33, 140, 22, 22, 22, 22, 101, 101, 101, 16, 101, 16, 16, 16, 16, 16, 16, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 16, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 89, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140,
+#> 123, 93, 93, 93, 93, 16, 16, 140, 140, 140, 140, 140, 140, 140, 140, 16, 52, 52, 123, 33, 101, 101, 101, 101, 101, 101, 101, 101, 101, 52, 52, 52, 52, 101, 101, 101, 101, 101, 101, 101, 101, 101, 33, 33, 33, 52, 140, 140, 26, 38, 101, 101, 16, 101, 140, 140, 140, 140, 140, 140, 140, 140, 140, 123, 140, 123, 123, 140, 52, 52, 52, 52, 140, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 106, 106, 106, 106, 106, 106, 106, 35, 35, 35, 35, 35, 35, 35, 35, 38, 38, 38,
+#> 22, 106, 106, 106, 106, 106, 22, 22, 22, 22, 22, 33, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 38, 38, 38, 123, 123, 89, 89, 89, 89, 26, 89, 26, 106, 106, 106, 106, 106, 125, 125, 125, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 89, 45, 89, 16, 52, 52, 52, 52, 101, 101, 45, 101, 45, 16, 16, 45, 45, 45, 45, 45, 93, 93, 101, 33, 33, 33, 33, 33, 33, 33, 33, 33, 45, 45, 45, 45, 45, 52, 52, 52, 52, 52, 123, 123, 123, 140, 140, 140, 140, 140, 140, 16, 22, 22, 106, 106, 33, 33, 33, 33, 33, 33,
+#> 33, 33, 33, 33, 101, 101, 101, 101, 101, 101, 101, 101, 101, 16, 16, 16, 16, 16, 16, 16, 16, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 89, 89, 89, 35, 35, 35, 35, 35, 35, 22, 22, 22, 102, 106, 106, 106, 106, 106, 106, 106, 102, 102, 102, 35, 102, 35, 35, 35, 45, 22, 22, 22, 22, 106, 35, 106, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 35, 22, 89, 89, 16, 16, 93, 93, 93, 93, 93, 93, 93, 93, 93, 52, 93, 52, 101, 22, 89,
+#> 106, 106, 106, 106, 22, 106, 22, 33, 33, 33, 33, 33, 33, 33, 140, 140, 140, 102, 140, 123, 16, 123, 123, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 38, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 22, 26, 26, 22, 22, 93, 93, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 102, 102, 102, 102, 102, 102, 125, 125, 125, 125, 125, 125, 102, 102, 102, 102,
+#> 102, 38, 38, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 26, 38, 106, 102, 22, 106, 106, 140, 123, 140, 123, 123, 123, 140, 140, 140, 140, 52, 140, 52, 52, 35, 16, 16, 16, 16, 26, 26, 26, 26, 26, 89, 89, 89, 38, 89, 38, 38, 38, 38, 26, 125, 125, 125, 125, 125, 125, 125, 125, 38, 38, 38, 38, 38, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 26, 125, 26, 26, 125, 89, 89, 89, 89, 89, 89, 89, 89, 89, 106, 106, 35, 22, 38, 38, 38, 38, 102, 45, 45, 45, 45, 33, 45,
+#> 33, 33, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 101, 101, 101, 101, 101, 101, 101, 101, 101, 101, 101, 101, 101, 101, 101, 33, 33, 33, 33, 33, 33, 33, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 101, 101, 101, 101, 101, 101, 33, 22, 33, 22, 125, 101, 101, 101, 101, 123, 123, 123, 123, 123, 123, 45, 45, 45, 45, 45, 45, 45, 16, 16, 16, 16, 140, 93, 140, 93, 22, 26, 123, 123, 123, 123, 123, 33, 123, 33, 33, 140, 140, 140, 123, 52, 123, 52, 89, 35, 35, 35, 35,
+#> 35, 35, 35, 93, 93, 93, 89, 26, 26, 38, 38, 38, 38, 38, 38, 38, 38, 106, 106, 106, 106, 106, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 93, 93, 93, 16, 89, 102, 102, 22, 22, 22, 89, 89, 101, 101, 101, 101, 101, 101, 101, 101, 101, 101, 101, 16, 16, 16, 16, 16, 16, 16, 35, 35, 102, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 52, 52, 26, 106, 106, 140, 140, 140, 140, 140, 140, 140, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 125, 125, 125, 125, 125, 125, 125, 125, 125, 38, 125,
+#> 38, 102, 123, 123, 123, 123, 123, 123, 123, 123, 123, 16, 123, 16, 16, 89, 101, 101, 101, 101, 101, 101, 101, 101, 101, 101, 101, 16, 16, 16, 16, 26, 26, 26, 26, 26, 26, 26, 26, 22, 106, 106, 125, 125, 38, 125, 38, 38, 38, 38, 38, 38, 38, 38, 38, 35, 35, 35, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 22, 89, 22, 22, 22, 22, 22, 22, 102, 102, 102, 102, 102, 102, 35, 35, 35, 102, 102, 102, 102, 106, 102, 102, 102, 102, 102, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 140, 35, 35, 35, 35,
+#> 35, 35, 35, 125, 125, 125, 125, 125, 35, 125, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 22, 35, 22, 22, 22, 26, 106, 45, 22, 22, 22, 22, 22, 22, 22, 89, 22, 89, 22, 22, 22, 125, 125, 125, 125, 125, 125, 125, 35, 35, 35, 35, 123, 106, 106, 106, 106, 102, 102, 102, 102, 89, 89, 89, 89, 35, 52, 52, 89, 89, 89, 89, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 101, 101, 101, 101, 101, 16, 16, 52, 52, 52, 52, 52, 52, 16, 52, 140, 140, 140, 140, 140, 140, 123, 123, 123, 123,
+#> 123, 123, 140, 140, 140, 140, 33, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 140, 140, 140, 140, 45, 45, 35, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 26, 26, 26, 26, 26, 26, 26, 26, 89, 38, 89, 38, 38, 102, 22, 22, 22, 22, 22, 22, 22, 26, 26, 26, 26, 26, 106, 106, 106, 106, 106, 106, 106, 45, 125, 125, 125, 125, 125, 125, 125, 125, 22, 125, 22, 22, 22, 89, 89, 26, 89, 22, 125, 125, 89, 26, 89, 26, 26, 26, 26, 26, 26, 26, 26, 22, 89, 106, 106, 106, 106, 106, 106, 106, 106, 106,
+#> 106, 22, 22, 22, 22, 93, 16, 93, 16, 16, 16, 101, 101, 38, 38, 38, 89, 52, 52, 52, 52, 52, 52, 52, 52, 52, 22, 52, 102, 102, 102, 102, 102, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 123, 93, 93, 93, 33, 101, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 106,
+#> 101, 101, 101, 101, 101, 101, 101, 16, 16, 16, 16, 16, 140, 52, 52, 52, 52, 52, 52, 52, 45, 45, 45, 45, 45, 45, 45, 123, 16, 16, 22, 22, 140, 52, 52, 52, 52, 52, 52, 52, 52, 16, 16, 16, 16, 16, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 52, 52, 52, 52, 52, 52, 33, 33, 16, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 33, 33, 33, 33, 52, 52, 123, 123, 123, 140, 45, 45, 45, 102, 38, 102, 93, 93, 93, 93, 45, 45, 45, 45, 45, 22, 123, 22, 22, 89, 89, 101, 101, 101, 101, 101,
+#> 101, 101, 33, 33, 33, 33, 16, 33, 16, 16, 101, 101, 101, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 106, 106, 106, 106, 106, 106, 106, 106, 106, 102, 106, 102, 106, 106, 106, 106, 106, 106, 35, 35, 35, 35, 35, 35, 22, 35, 22, 16, 16, 16, 16, 16, 16, 16, 93, 93, 93, 26, 38, 26, 26, 26, 26, 106, 140, 26, 45, 45, 52, 52, 52, 52, 52, 52, 123, 123, 102, 102, 102, 102, 102, 26, 102, 26, 26, 26, 102, 102,
+#> 102, 102, 26, 26, 26, 22, 26, 26, 125, 125, 125, 125, 125, 125, 89, 89, 89, 89, 89, 93, 93, 93, 93, 93, 35, 35, 35, 35, 35, 35, 89, 89, 26, 89, 26, 125, 123, 26, 26, 26, 38, 38, 38, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 16, 16, 16, 16, 16, 16, 16, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 33, 106, 106, 106, 35, 106, 35, 38, 123, 123, 123, 123, 123, 45, 45, 45, 45, 38, 93, 93, 93, 102, 102, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 123, 140, 123, 26, 26, 22, 22, 35,
+#> 123, 123, 140, 140, 16, 140, 123, 52, 123, 52, 52, 22, 140, 22, 123, 140, 101, 101, 101, 140, 93, 140, 89, 101, 140, 101, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 35, 45, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 102, 26, 102, 26, 22, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 26, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 102, 102, 26, 102, 26, 35, 38, 38, 38, 38, 38, 38, 38, 38, 35, 35, 93, 93, 93, 93, 93, 93, 93, 45, 45, 45, 45, 101, 101,
+#> 101, 101, 101, 101, 101, 101, 101, 101, 140, 16, 16, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 22, 22, 22, 22, 140, 140, 140, 140, 140, 140, 140, 140, 140, 102, 102, 35, 35, 35, 35, 35, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 26, 26, 16, 16, 102, 102, 102, 102, 38, 102, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 26, 102, 102, 35, 102, 35, 125, 125, 22, 125, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 35, 38, 38, 38, 38, 38, 38, 38, 35, 93,
+#> 89, 93, 106, 106, 106, 22, 22, 22, 22, 22, 22, 22, 89, 89, 89, 89, 89, 89, 35, 35, 35, 89, 123, 123, 123, 123, 123, 123, 123, 123, 123, 123, 140, 140, 140, 101, 101, 101, 101, 101, 101, 101, 101, 101, 123, 123, 101, 45, 101, 33, 45, 16, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 52, 52, 93, 101, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 102, 102, 102, 102, 102, 38, 38, 26, 26, 26, 26, 38, 38, 38, 38, 38, 102, 102, 125, 16, 16, 16, 16, 16, 16, 16, 102, 102, 45, 45, 45, 45, 33, 33, 33, 33, 33, 33, 33, 33,
+#> 33, 33, 33, 89, 16, 16, 16, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 35, 35, 102, 102, 102, 102, 22, 22, 22, 22, 22, 22, 16, 125, 125, 125, 125, 125, 125, 125, 106, 52, 52, 52, 52, 33, 52, 33, 33, 33, 45, 22, 22, 22, 22, 22, 22, 102, 125, 125, 125, 125, 26, 26, 26, 38, 38, 38, 38, 38, 38, 38, 38, 106, 106, 125, 125, 125, 125, 125, 22, 22, 22, 22, 22, 22, 26, 26, 106, 45, 35, 35, 35, 102, 102, 22, 22, 22, 22, 22, 106, 106, 89, 106, 89, 125, 125, 125, 125, 125, 125, 125, 125, 125,
+#> 125, 125, 125, 125, 93, 64, 93, 64, 93, 93, 93, 80, 93, 35, 35, 35, 35, 35, 35, 35, 35, 89, 89, 89, 89, 89, 89, 89, 35, 35, 22, 22, 22, 26, 26, 26, 93, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 16, 16, 16, 16, 16, 16, 16, 16, 16, 93, 93, 93, 93, 93, 93, 93, 106, 106, 106, 16, 16, 16, 45, 45, 45, 45, 45, 16, 106, 101, 101, 101, 101, 101, 101, 101, 101, 16, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 16, 16, 140, 140, 140, 140, 140, 16, 16, 123, 123, 123, 123, 123, 123, 123, 123, 16, 16, 16,
+#> 16, 16, 33, 123, 5, 5, 33, 125, 125, 125, 125, 125, 125, 125, 26, 125, 26, 26, 89, 35, 102, 102, 102, 102, 38, 125, 125, 125, 26, 26, 26, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 123, 123, 125, 125, 125, 125, 22, 22, 22, 22, 22, 35, 35, 35, 16, 16, 16, 16, 16, 16, 16, 16, 16, 52, 52, 52, 140, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 16, 16, 33, 101, 93, 93, 93, 93, 93, 93, 93, 125, 125, 125, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 16, 52, 5, 89, 89, 89, 89, 102, 102, 45,
+#> 45, 45, 45, 45, 45, 52, 52, 52, 52, 52, 52, 52, 93, 89, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 52, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 125, 125, 125, 125, 125, 125, 89, 89, 89, 38, 89, 26, 38, 26, 26, 80, 35, 106, 35, 125, 125, 26, 26, 38, 38, 106, 106, 106, 106, 106, 102, 89, 102, 93, 93, 93, 93, 93, 93, 93, 93, 123, 45, 45, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 45, 45, 106, 106,
+#> 106, 106, 106, 106, 106, 106, 26, 26, 26, 26, 26, 89, 33, 123, 125, 125, 125, 125, 26, 26, 26, 125, 125, 102, 125, 102, 35, 102, 35, 26, 35, 89, 89, 89, 89, 89, 26, 89, 26, 26, 35, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 93, 93, 93, 93, 33, 93, 33, 52, 22, 52, 22, 22, 22, 22, 22, 22, 22, 22, 106, 106, 101, 101, 102, 102, 93, 93, 93, 93, 102, 38, 38, 22, 22, 22, 22, 26, 26, 26, 26, 26, 89, 26, 26, 33, 33, 33, 22, 89, 89, 89, 101, 52, 52, 52, 52, 16, 16, 16, 16, 16, 16, 45, 45, 45,
+#> 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 52, 52, 52, 52, 52, 101, 101, 101, 140, 140, 140, 45, 106, 52, 52, 22, 123, 123, 93, 123, 140, 45, 45, 45, 52, 52, 52, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 33, 33, 125, 125, 125, 125, 125, 125, 125, 125, 125, 35, 35, 35, 35, 35, 35, 35, 35, 22, 35, 22, 80, 80, 80, 80, 80, 80, 80, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 123, 93, 93, 93, 35, 93, 35, 35, 35, 102, 52, 102, 106, 52, 26, 26, 26, 26, 26, 26,
+#> 26, 26, 26, 26, 22, 38, 38, 38, 38, 26, 26, 26, 125, 125, 26, 26, 26, 35, 35, 35, 35, 35, 35, 101, 101, 140, 22, 22, 22, 22, 22, 22, 89, 89, 26, 26, 101, 52, 52, 52, 52, 52, 140, 140, 140, 140, 140, 140, 140, 140, 45, 45, 140, 140, 140, 140, 140, 140, 16, 16, 45, 80, 106, 101, 101, 101, 52, 101, 52, 52, 52, 52, 52, 16, 52, 16, 16, 33, 33, 5, 33, 5, 93, 93, 93, 93, 33, 52, 52, 16, 52, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 16, 16, 125, 125, 125, 125, 125, 125, 125, 125, 106, 125, 106,
+#> 35, 106, 35, 35, 33, 106, 35, 22, 35, 22, 22, 22, 26, 26, 89, 89, 125, 125, 35, 35, 35, 35, 35, 35, 35, 106, 106, 106, 106, 35, 35, 35, 35, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 125, 125, 33, 38, 26, 26, 26, 26, 26, 26, 26, 93, 93, 93, 93, 64, 93, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 72, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 38, 123, 123, 123, 123, 123, 123, 123, 123, 101, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93,
+#> 94, 45, 45, 45, 45, 45, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 22, 22, 22, 22, 22, 22, 35, 35, 35, 140, 38, 38, 38, 38, 38, 38, 38, 38, 38, 93, 93, 64, 106, 106, 106, 106, 106, 106, 106, 35, 106, 35, 45, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 52, 52, 93, 22, 26, 26, 26, 26, 26, 26, 26, 26, 80, 80, 80, 80, 80, 80, 80, 80, 80, 80, 80, 80, 94, 117, 89, 89, 89, 89, 89, 26, 26, 26, 38, 38, 33, 33, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 101, 101, 101, 101, 101, 101,
+#> 33, 33, 45, 52, 52, 52, 52, 52, 52, 52, 52, 52, 16, 52, 16, 16, 16, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 93, 93, 93, 93, 93, 93, 93, 93, 125, 64, 125, 26, 26, 26, 26, 26, 26, 26, 26, 26, 26, 26, 106, 33, 33, 33, 35, 35, 35, 35, 35, 35, 35, 22, 35, 22, 38, 93, 93, 140, 140, 140, 5, 16, 26, 26, 26, 89, 89, 89, 89, 89, 89, 89, 125, 125, 35, 125, 35, 80, 102, 93, 93, 93, 93, 93, 93, 93, 106, 33, 33, 33, 33, 33, 33, 33, 33, 140, 140, 101, 123, 140, 101, 33, 16, 16, 16, 16,
+#> 16, 16, 16, 16, 16, 16, 52, 52, 52, 52, 52, 52, 123, 123, 5, 45, 45, 45, 45, 45, 16, 16, 16, 52, 52, 52, 79, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 72, 72, 72, 72, 94, 94, 89, 89, 89, 89, 89, 89, 89, 26, 26, 26, 80, 106, 89, 106, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 38, 72, 38, 38, 45, 123, 123, 123, 123, 123, 140, 140, 140, 140, 140, 140, 33, 33, 102, 102, 102, 141, 141, 123, 123, 16, 16, 16, 16, 16, 16, 16, 16, 33, 125, 33, 93, 93, 93, 93, 93, 93, 93, 93,
+#> 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 16, 16, 16, 16, 52, 52, 52, 33, 33, 33, 33, 38, 5, 38, 5, 5, 52, 52, 52, 52, 52, 52, 52, 45, 52, 45, 45, 45, 5, 45, 38, 26, 102, 102, 102, 102, 102, 102, 93, 102, 93, 93, 125, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 72, 72, 72, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 72, 72, 72, 72, 72, 94, 117, 89, 89, 89, 89, 89, 89, 89, 89, 38, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 45, 102, 64, 26, 26, 26,
+#> 106, 45, 45, 45, 45, 45, 45, 45, 45, 45, 33, 33, 45, 33, 52, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 89, 89, 89, 89, 89, 89, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 94, 117, 94, 89, 89, 89, 89, 89, 89, 45, 89, 22, 45, 22, 93, 93, 125, 125, 106, 106, 106, 106, 22, 22, 22, 22, 22, 22, 22, 101, 101, 101, 101, 101, 101, 64, 64, 93, 93, 93, 93, 106, 58, 125, 125, 35, 102, 125, 38, 38, 38, 38, 35, 38, 35, 35, 35, 35, 35, 35, 125, 89, 117, 117, 101, 101, 101, 93, 5, 33, 33,
+#> 52, 22, 22, 22, 22, 38, 38, 140, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 5, 5, 5, 5, 58, 35, 58, 45, 45, 45, 45, 45, 45, 93, 93, 93, 93, 93, 93, 64, 93, 52, 45, 38, 79, 80, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 52, 52, 52, 52, 52, 52, 52, 52, 45, 117, 117, 117, 117, 35, 117, 35, 102, 22, 22, 22, 22, 22, 72, 72, 72, 72, 72, 72, 72, 72, 72, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 89,
+#> 125, 80, 89, 80, 80, 80, 125, 125, 125, 93, 93, 93, 93, 140, 140, 140, 140, 140, 16, 16, 16, 106, 35, 106, 106, 89, 89, 89, 89, 89, 89, 117, 93, 93, 93, 93, 64, 93, 64, 38, 45, 125, 64, 125, 125, 125, 125, 125, 72, 72, 72, 72, 72, 72, 72, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 106, 33, 106, 33, 71, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 5, 16, 80, 26, 26, 26, 80, 89, 89, 89, 89, 117, 117, 117, 45, 80, 38, 38, 116, 116, 116, 116, 116, 35, 86, 22, 22, 22, 22, 72, 72, 72, 72, 72, 72, 72, 72, 52,
+#> 72, 52, 114, 45, 45, 45, 45, 45, 33, 33, 33, 125, 106, 125, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 101, 101, 101, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 58, 58, 26, 80, 80, 80, 80, 80, 80, 80, 80, 80, 80, 80, 80, 80, 4, 52, 58, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 123, 5, 93, 93,
+#> 93, 93, 93, 64, 33, 64, 117, 117, 58, 117, 5, 58, 35, 33, 33, 33, 33, 33, 33, 33, 5, 5, 5, 5, 5, 33, 33, 33, 16, 16, 16, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 5, 5, 5, 5, 5, 5, 72, 30, 30, 45, 45, 45, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 94, 33, 94, 33, 72, 72, 80, 80, 80, 80, 80, 80, 80, 80, 80, 80, 80, 80, 4, 4, 4, 4, 4, 4, 4, 4, 4, 83, 83, 52, 52, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 117, 117, 117, 93, 26, 26, 80, 80, 80, 80, 80, 80, 80, 80, 80, 80, 80, 125,
+#> 35, 125, 35, 102, 30, 30, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 30, 45, 93, 93, 123, 123, 123, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 45, 33, 45, 33, 33, 33, 33, 33, 33, 45, 45, 33, 33, 125, 141, 33, 33, 33, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 80, 80, 80, 80, 94, 94, 94, 93, 93, 93, 93, 93, 93, 93, 93, 93, 102, 102, 102, 117, 117, 117, 117, 117, 117, 30, 117, 30, 30, 64, 52, 52, 52, 52, 52, 52, 52, 52, 52, 102, 102, 102, 102, 106, 72, 106, 102, 102, 93, 93, 93, 93, 93, 93, 93,
+#> 93, 93, 93, 93, 93, 16, 93, 16, 123, 123, 5, 93, 93, 93, 93, 93, 93, 93, 93, 16, 71, 101, 64, 64, 64, 45, 64, 45, 45, 45, 79, 79, 71, 79, 102, 30, 52, 52, 52, 52, 52, 52, 80, 80, 80, 80, 80, 4, 16, 16, 16, 16, 16, 16, 16, 16, 45, 45, 45, 141, 71, 94, 141, 71, 30, 30, 30, 93, 93, 93, 64, 64, 64, 64, 5, 5, 30, 16, 117, 16, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 26, 26, 80, 80, 80, 80, 80, 80, 80, 80, 80, 80, 80, 117, 106, 45, 125, 125, 125, 125, 102, 125,
+#> 102, 38, 106, 106, 106, 106, 106, 5, 5, 93, 93, 93, 140, 140, 16, 16, 16, 16, 16, 16, 16, 140, 5, 140, 5, 71, 71, 71, 71, 30, 30, 117, 117, 117, 117, 117, 117, 117, 117, 117, 125, 125, 125, 4, 4, 4, 4, 96, 16, 66, 106, 106, 106, 106, 106, 106, 106, 106, 38, 35, 35, 80, 94, 94, 94, 102, 58, 80, 102, 35, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 93, 94, 72, 72, 72, 72, 72, 72, 52, 52, 52, 52, 58, 30, 140, 140, 140, 140, 140, 140, 140, 140, 45, 45, 45, 45, 45, 45, 45,
+#> 45, 45, 33, 33, 33, 33, 33, 45, 22, 22, 72, 72, 72, 72, 94, 38, 94, 89, 125, 117, 117, 5, 5, 5, 5, 5, 5, 102, 58, 102, 140, 140, 140, 79, 79, 79, 79, 79, 79, 79, 79, 79, 79, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 114, 114, 96, 114, 117, 117, 117, 117, 45, 45, 35, 35, 125, 125, 117, 117, 117, 52, 125, 5, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 33, 33, 33,
+#> 33, 33, 140, 79, 79, 79, 79, 79, 79, 79, 33, 33, 33, 33, 33, 33, 33, 33, 64, 45, 16, 52, 58, 45, 45, 64, 64, 93, 93, 93, 93, 93, 93, 93, 125, 125, 89, 117, 125, 125, 125, 125, 125, 125, 125, 102, 102, 102, 125, 106, 106, 106, 106, 106, 106, 106, 106, 106, 125, 125, 125, 102, 102, 117, 5, 5, 5, 5, 5, 33, 33, 33, 33, 33, 33, 141, 33, 93, 93, 66, 72, 72, 72, 72, 72, 72, 72, 141, 141, 141, 141, 141, 141, 141, 52, 131, 52, 93, 93, 93, 93, 93, 93, 93, 93, 93, 72, 33, 141, 33, 33, 30, 33, 125, 125, 125,
+#> 125, 125, 35, 125, 35, 35, 140, 33, 33, 33, 5, 33, 5, 16, 16, 16, 16, 16, 16, 16, 79, 125, 125, 125, 125, 125, 125, 125, 125, 35, 35, 35, 117, 117, 93, 117, 93, 93, 93, 93, 93, 66, 66, 5, 5, 5, 5, 5, 35, 94, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 80, 94, 33, 94, 22, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 79, 79, 141, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38,
+#> 38, 125, 45, 45, 30, 30, 66, 66, 72, 72, 72, 72, 72, 72, 72, 72, 106, 106, 72, 86, 72, 72, 72, 16, 16, 106, 106, 106, 4, 106, 4, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 96, 96, 33, 33, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 45, 45, 45, 45, 45, 52, 52, 52, 52, 64, 45, 45, 33, 45, 72, 93, 35, 35, 102, 102, 102, 38, 102, 38, 38, 38, 106, 106, 106, 106, 106, 33, 106, 33, 33, 33, 80, 80, 80, 80, 80, 80, 80, 38, 38, 38, 38, 38, 4, 38, 125, 106, 106, 38, 93,
+#> 93, 93, 93, 125, 125, 125, 102, 125, 89, 117, 117, 117, 117, 117, 5, 5, 5, 5, 5, 4, 117, 117, 125, 71, 71, 71, 45, 45, 45, 45, 33, 45, 117, 93, 64, 93, 64, 64, 93, 93, 93, 93, 93, 93, 45, 64, 94, 94, 22, 22, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 140, 140, 79, 79, 79, 79, 79, 79, 79, 79, 79, 79, 79, 79, 33, 79, 33, 33, 102, 102, 102, 93, 102, 93, 125, 125, 125, 125, 35, 35, 35, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 93, 93, 93, 93, 93, 93, 93, 93, 52, 93, 26, 26,
+#> 26, 52, 33, 33, 33, 33, 33, 33, 141, 45, 45, 45, 45, 72, 72, 72, 72, 72, 72, 72, 72, 94, 33, 58, 115, 35, 58, 96, 96, 5, 35, 5, 5, 5, 30, 66, 106, 106, 106, 106, 38, 38, 38, 38, 38, 38, 38, 125, 106, 16, 16, 16, 16, 16, 45, 35, 45, 52, 86, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 52, 106, 86, 22, 22, 22, 72, 72, 72, 72, 72, 72, 72, 72, 72, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 140, 140, 79, 79, 79, 79, 79, 79, 79,
+#> 72, 45, 141, 4, 38, 38, 38, 38, 38, 38, 38, 125, 58, 58, 58, 58, 58, 58, 38, 38, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 141, 102, 102, 102, 102, 102, 102, 102, 102, 86, 86, 86, 86, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 16, 16, 16, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 102, 102, 102, 102, 102, 38, 86, 38, 38, 93, 93, 93, 93, 93, 93, 93, 93, 35, 58, 35, 35, 4, 35, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 16, 72, 33, 33,
+#> 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 35, 35, 93, 93, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 71, 71, 71, 71, 30, 30, 79, 79, 79, 45, 94, 52, 45, 45, 45, 45, 45, 30, 45, 30, 125, 125, 106, 106, 96, 106, 96, 72, 72, 72, 72, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 33, 125, 102, 102, 102, 102, 102, 102, 93, 93, 93, 30, 79, 79, 79, 79, 79, 79, 79, 79, 79, 79, 79, 79, 79, 79, 79, 102, 102, 102, 102, 102, 102, 102, 125, 72, 33, 33,
+#> 33, 102, 102, 96, 106, 106, 106, 106, 106, 16, 16, 102, 72, 94, 30, 140, 140, 140, 140, 140, 140, 140, 79, 79, 79, 79, 79, 79, 79, 79, 79, 79, 79, 79, 79, 79, 66, 71, 71, 71, 71, 30, 30, 30, 30, 30, 30, 30, 94, 94, 131, 131, 131, 131, 106, 131, 106, 94, 94, 94, 94, 72, 117, 117, 117, 86, 86, 86, 86, 125, 80, 80, 80, 80, 80, 80, 4, 4, 4, 125, 125, 125, 125, 125, 125, 94, 94, 94, 106, 106, 106, 106, 106, 106, 106, 106, 72, 114, 72, 106, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 38,
+#> 38, 38, 38, 38, 38, 38, 38, 38, 79, 79, 79, 30, 45, 131, 131, 5, 5, 5, 5, 58, 93, 93, 96, 96, 114, 72, 72, 72, 72, 72, 72, 72, 72, 125, 45, 45, 45, 45, 45, 38, 38, 86, 79, 79, 79, 79, 30, 30, 45, 35, 45, 93, 4, 35, 45, 45, 45, 45, 45, 45, 45, 79, 79, 79, 79, 72, 86, 125, 96, 106, 96, 106, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 64, 93, 64, 38, 38, 38, 38, 4, 102, 102, 102, 102, 96, 102, 16, 83, 96, 16, 33, 16, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106,
+#> 106, 106, 106, 106, 106, 117, 117, 117, 33, 33, 33, 33, 5, 33, 5, 45, 30, 30, 30, 30, 33, 33, 125, 140, 140, 140, 140, 45, 45, 35, 4, 35, 38, 38, 35, 35, 66, 125, 66, 66, 71, 30, 30, 30, 30, 30, 33, 33, 66, 66, 45, 45, 45, 33, 33, 33, 94, 94, 94, 94, 94, 58, 125, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 38, 38, 38, 38, 38, 38, 38, 38, 58, 58, 58, 58, 106, 16, 106, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 45, 45, 72, 141, 141, 141, 141, 141, 141, 141, 4, 4, 4, 16, 16, 16, 16, 16, 16,
+#> 16, 52, 52, 52, 52, 52, 114, 117, 117, 117, 117, 117, 117, 80, 80, 4, 4, 4, 4, 96, 93, 96, 93, 86, 93, 83, 64, 64, 64, 64, 96, 93, 115, 93, 93, 35, 93, 35, 4, 94, 52, 52, 52, 52, 52, 52, 72, 72, 35, 72, 35, 35, 35, 33, 35, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 86, 86, 86, 16, 16, 16, 102, 38, 38, 38, 35, 35, 35, 35, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 16, 16, 16, 16, 16, 16, 16, 83, 102, 102, 102, 102, 102, 102, 102, 89, 89, 117, 117, 117,
+#> 117, 117, 5, 5, 141, 141, 117, 117, 117, 93, 117, 66, 16, 16, 16, 16, 16, 16, 83, 83, 83, 83, 83, 16, 16, 16, 66, 93, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 93, 93, 38, 93, 93, 72, 72, 72, 72, 72, 72, 72, 72, 72, 117, 117, 35, 35, 35, 35, 35, 35, 35, 35, 79, 114, 35, 35, 79, 79, 79, 79, 79, 79, 79, 79, 79, 79, 79, 79, 30, 30, 30, 30, 30, 30, 30, 94, 94, 94, 94, 94, 94, 94, 94, 94, 94, 38, 94, 38, 38, 38, 38, 38, 94, 33, 33, 16, 33, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 102, 102, 86, 102,
+#> 125, 16, 125, 16, 102, 102, 102, 102, 102, 102, 58, 58, 58, 58, 58, 58, 58, 58, 58, 58, 58, 72, 72, 4, 83, 93, 102, 35, 102, 35, 35, 35, 35, 35, 35, 35, 131, 131, 16, 16, 131, 131, 131, 131, 35, 35, 30, 30, 30, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 94, 114, 114, 52, 52, 52, 52, 52, 52, 52, 52, 141, 4, 96, 16, 16, 16, 16, 16, 16, 16, 16, 125, 125, 72, 125, 72, 72, 72, 72, 72, 117, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 35, 35, 35, 35, 35, 35, 35, 35, 35, 114, 114,
+#> 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 96, 125, 96, 106, 96, 106, 96, 93, 93, 93, 93, 93, 33, 33, 33, 33, 96, 96, 86, 96, 86, 86, 86, 86, 30, 102, 64, 64, 64, 64, 141, 16, 64, 141, 16, 16, 45, 45, 45, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 131, 45, 96, 134, 116, 116, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 86, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 125, 33, 125, 33, 33, 16, 16, 16, 16, 106,
+#> 106, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 94, 94, 94, 94, 38, 125, 58, 58, 58, 58, 5, 5, 5, 5, 5, 5, 5, 5, 30, 5, 5, 5, 5, 5, 5, 5, 5, 4, 4, 4, 102, 35, 102, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 72, 4, 4, 4, 4, 4, 4, 4, 94, 94, 94, 94, 94, 64, 64, 64, 93, 93, 93, 93, 93, 93, 93, 93, 4, 4, 4, 4, 4, 5, 45, 66, 66, 66, 66, 66, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 72, 72, 125, 125, 125, 125, 125, 72, 102, 102, 16, 35, 16, 64, 96, 96, 96, 96, 96,
+#> 96, 96, 96, 5, 93, 93, 93, 93, 93, 30, 30, 30, 30, 30, 96, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 125, 125, 125, 125, 125, 125, 125, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 33, 102, 117, 45, 79, 79, 117, 117, 117, 117, 117, 117, 106, 106, 106, 106, 106, 125, 96, 125, 93, 125, 114, 94, 94, 94, 94, 94, 94, 94, 94, 94, 94, 94, 94, 33, 72, 72, 72, 72, 72, 72, 72, 79, 79, 79, 52, 79, 52, 72, 30, 125, 38, 38, 38, 79, 93, 125, 33, 58, 86, 106, 106, 106, 106, 106,
+#> 106, 106, 106, 86, 94, 94, 94, 125, 45, 45, 45, 45, 45, 79, 79, 79, 79, 79, 79, 79, 79, 79, 79, 52, 45, 45, 96, 30, 30, 30, 30, 30, 30, 131, 131, 131, 33, 33, 93, 93, 93, 93, 96, 96, 45, 45, 45, 45, 45, 45, 96, 96, 96, 45, 45, 116, 83, 33, 33, 33, 33, 33, 33, 33, 33, 33, 30, 30, 30, 83, 45, 58, 58, 58, 58, 58, 58, 58, 58, 58, 114, 114, 134, 16, 16, 16, 16, 16, 16, 30, 16, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 86, 86, 86, 86, 4, 4, 4, 4, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 117, 93, 117,
+#> 93, 106, 79, 79, 79, 79, 38, 38, 38, 38, 131, 131, 131, 125, 125, 125, 125, 38, 38, 38, 38, 114, 114, 102, 102, 106, 114, 96, 96, 96, 96, 96, 96, 96, 96, 96, 117, 117, 117, 117, 66, 66, 117, 117, 94, 94, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 106, 117, 117, 117, 117, 117, 117, 117, 93, 30, 30, 33, 131, 45, 125, 35, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 86, 125, 131, 114, 30, 94, 94, 94, 94, 94, 94, 94, 94, 94, 94, 94, 94, 94, 102, 102, 131, 45, 45, 45, 45, 93, 93,
+#> 93, 93, 93, 93, 4, 4, 4, 4, 4, 4, 4, 93, 4, 4, 4, 5, 5, 4, 4, 86, 96, 38, 102, 102, 102, 102, 102, 102, 102, 66, 125, 66, 66, 66, 66, 66, 66, 66, 93, 93, 93, 93, 93, 93, 93, 93, 117, 117, 35, 35, 35, 93, 93, 93, 93, 93, 5, 5, 5, 5, 5, 5, 38, 38, 114, 114, 30, 30, 30, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 38, 38, 38, 38, 38, 38, 38, 58, 58, 58, 5, 5, 5, 5, 5, 5, 66, 66, 106, 106, 106, 106, 106, 106, 106, 106, 106, 96, 106, 106, 106, 64, 16, 64, 96, 83, 83, 83, 45, 79, 30, 45, 94,
+#> 66, 94, 58, 58, 58, 58, 58, 58, 125, 106, 106, 106, 106, 106, 106, 106, 35, 96, 58, 58, 58, 58, 58, 58, 58, 58, 58, 38, 38, 38, 38, 38, 38, 38, 38, 58, 117, 117, 102, 96, 96, 96, 96, 96, 96, 96, 96, 96, 114, 114, 114, 114, 125, 125, 106, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 45, 45, 45, 45, 131, 131, 131, 114, 114, 93, 131, 4, 116, 66, 116, 30, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 141, 141, 141, 141,
+#> 141, 141, 141, 141, 141, 141, 52, 52, 52, 52, 93, 125, 131, 58, 58, 58, 58, 58, 58, 58, 58, 58, 58, 58, 58, 38, 38, 38, 38, 125, 72, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 35, 35, 35, 35, 94, 94, 94, 94, 94, 94, 94, 94, 131, 131, 131, 131, 131, 131, 64, 96, 96, 96, 96, 96, 96, 96, 96, 96, 30, 30, 30, 30, 16, 96, 45, 45, 45, 45, 141, 66, 30, 38, 30, 66, 125, 117, 117, 117, 117, 117, 117, 86, 117, 86, 86, 86, 86, 86, 86, 79, 86, 125, 35, 35, 117, 117, 117, 16, 16, 16, 16, 16, 93,
+#> 93, 93, 93, 93, 93, 93, 131, 102, 131, 102, 33, 102, 80, 80, 4, 4, 4, 38, 38, 38, 38, 38, 38, 38, 38, 33, 33, 125, 106, 64, 64, 64, 64, 96, 96, 96, 96, 96, 96, 96, 96, 96, 131, 131, 30, 131, 30, 30, 93, 5, 5, 5, 5, 5, 5, 5, 30, 30, 30, 30, 30, 30, 30, 30, 30, 30, 94, 94, 94, 86, 86, 86, 86, 86, 86, 96, 131, 131, 94, 94, 94, 4, 94, 4, 125, 125, 35, 58, 58, 58, 58, 58, 58, 58, 58, 117, 117, 117, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 114,
+#> 117, 117, 117, 117, 117, 4, 4, 4, 4, 102, 102, 102, 35, 35, 35, 35, 116, 58, 58, 58, 58, 66, 66, 66, 66, 66, 66, 134, 134, 134, 134, 93, 134, 64, 64, 96, 96, 96, 96, 96, 96, 96, 96, 96, 83, 83, 83, 83, 83, 35, 35, 35, 35, 35, 35, 35, 96, 96, 96, 96, 5, 93, 93, 35, 93, 35, 4, 4, 4, 4, 4, 4, 4, 4, 117, 117, 117, 117, 117, 117, 117, 117, 52, 52, 52, 52, 52, 4, 117, 117, 117, 117, 117, 117, 117, 125, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 52, 115, 58, 86, 86, 86, 86,
+#> 72, 72, 4, 72, 4, 131, 79, 79, 79, 94, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 114, 114, 114, 114, 114, 64, 64, 64, 64, 64, 96, 96, 96, 96, 96, 96, 96, 64, 64, 64, 96, 96, 96, 96, 96, 96, 96, 93, 93, 93, 93, 93, 58, 58, 58, 38, 38, 38, 38, 38, 38, 38, 38, 38, 66, 66, 66, 30, 30, 30, 30, 30, 72, 72, 72, 4, 4, 93, 72, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 79, 79, 79, 79, 79, 79, 79, 131, 141, 141, 131, 131, 131, 131, 131, 4, 4, 4, 4, 116, 96, 96,
+#> 96, 134, 131, 131, 131, 131, 131, 45, 114, 45, 45, 45, 45, 45, 45, 125, 125, 125, 125, 102, 125, 102, 102, 102, 102, 45, 45, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 38, 38, 38, 38, 38, 38, 38, 93, 93, 106, 106, 106, 106, 106, 106, 33, 131, 131, 131, 116, 116, 116, 33, 33, 33, 33, 33, 33, 106, 72, 72, 72, 72, 72, 4, 4, 4, 30, 96, 96, 96, 96, 96, 96, 96, 96, 96, 114, 114, 114, 114, 83, 83, 83, 83, 131, 35, 35, 35, 117, 117, 106, 117, 106, 106, 106,
+#> 106, 106, 72, 106, 72, 52, 72, 45, 45, 45, 45, 45, 45, 79, 16, 16, 16, 16, 16, 16, 16, 16, 93, 93, 106, 30, 16, 16, 16, 16, 16, 16, 16, 30, 30, 30, 30, 5, 5, 5, 5, 52, 52, 114, 125, 125, 125, 125, 117, 125, 125, 125, 125, 35, 106, 117, 117, 117, 102, 117, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 38, 38, 38, 38, 38, 38, 38, 38, 38, 30, 38, 117, 117, 117, 117, 117, 117, 117, 4, 114, 93, 114, 93, 93, 93, 79, 79, 79, 45, 45, 45, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 114, 114, 114,
+#> 4, 86, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 141, 141, 131, 131, 131, 131, 131, 131, 131, 45, 45, 45, 45, 45, 93, 131, 131, 114, 114, 114, 114, 114, 114, 114, 114, 94, 94, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 33, 33, 33, 33, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 131, 131, 131, 131, 86, 86, 102, 117, 72, 134, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 38, 38, 38, 38, 96, 96, 83, 30, 134, 33, 33, 33, 33, 33, 106, 93, 93, 93, 93, 93,
+#> 93, 114, 114, 114, 114, 35, 93, 117, 131, 96, 96, 116, 125, 125, 125, 125, 125, 125, 125, 125, 66, 66, 4, 4, 4, 117, 117, 38, 117, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 94, 94, 94, 94, 33, 94, 30, 30, 30, 30, 141, 52, 52, 52, 52, 52, 52, 52, 52, 52, 93, 114, 93, 33, 5, 33, 131, 131, 131, 131, 131, 131, 131, 131, 131, 131, 83, 66, 66, 35, 35, 131, 131, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 5, 45, 45, 45, 45, 45, 45, 45, 45, 45, 83, 83, 83, 83, 83, 45, 45, 33,
+#> 33, 33, 33, 33, 33, 33, 72, 72, 72, 72, 72, 72, 93, 93, 93, 30, 93, 30, 30, 30, 96, 93, 93, 93, 93, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 58, 58, 83, 83, 83, 30, 96, 30, 30, 72, 79, 79, 79, 79, 16, 16, 16, 16, 16, 35, 35, 102, 125, 52, 86, 38, 38, 38, 38, 125, 93, 102, 102, 66, 35, 52, 52, 52, 52, 52, 117, 114, 114, 114, 125, 94, 38, 38, 94, 94, 94, 94, 94, 94, 72, 72, 102, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 38, 38, 38, 38, 66,
+#> 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 30, 30, 30, 30, 30, 30, 30, 30, 16, 131, 131, 131, 52, 131, 52, 52, 52, 52, 52, 52, 52, 93, 94, 30, 30, 30, 30, 30, 30, 93, 93, 93, 93, 131, 131, 131, 131, 131, 131, 30, 102, 102, 102, 102, 102, 102, 117, 4, 117, 4, 94, 94, 131, 86, 114, 86, 106, 102, 106, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 30, 30, 30, 30, 30, 30, 30, 66, 66, 38, 38, 38, 38, 38, 38, 38, 38, 38, 93, 93, 93, 93, 4, 93, 4, 4, 38, 38, 38, 116, 116, 66, 66, 66, 66,
+#> 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 16, 16, 16, 16, 131, 131, 131, 93, 116, 30, 30, 30, 30, 30, 5, 66, 134, 134, 66, 66, 66, 66, 66, 66, 30, 52, 52, 116, 116, 116, 116, 116, 4, 4, 4, 4, 4, 4, 4, 4, 72, 72, 72, 72, 72, 72, 72, 72, 117, 96, 96, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 72, 72, 72, 94, 94, 45, 45, 5, 45, 2, 72, 86, 86, 86, 86, 86, 86, 86, 86, 86, 86, 86, 35, 35, 35, 35, 35, 35, 16, 16, 55, 55, 106, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 72, 72, 96, 83, 94,
+#> 102, 102, 102, 102, 79, 79, 79, 79, 79, 83, 83, 83, 83, 83, 94, 94, 94, 94, 94, 30, 30, 30, 30, 30, 30, 30, 30, 58, 58, 58, 58, 58, 58, 58, 58, 58, 131, 131, 131, 131, 131, 16, 16, 16, 16, 16, 16, 16, 30, 30, 30, 30, 30, 5, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 83, 83, 83, 83, 83, 4, 4, 4, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 93, 35, 35, 106, 106, 106, 117, 117, 117, 117, 117, 125, 125, 125, 125, 125, 125, 114, 114, 114, 114, 114, 114, 114, 114, 114, 94, 114, 33, 33,
+#> 33, 33, 93, 93, 93, 93, 93, 93, 131, 131, 66, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 16, 16, 16, 16, 16, 16, 16, 30, 30, 30, 16, 16, 16, 16, 16, 125, 125, 125, 125, 125, 125, 125, 125, 125, 94, 125, 94, 94, 94, 94, 94, 94, 45, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 96, 96, 35, 96, 35, 35, 58, 58, 86, 86, 86, 86, 86, 86, 86, 94, 94, 30, 131, 80, 80, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 93, 93, 45, 4, 45, 134, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52,
+#> 52, 52, 52, 52, 52, 4, 4, 4, 4, 4, 4, 4, 4, 4, 125, 58, 58, 58, 58, 58, 58, 86, 86, 86, 94, 94, 94, 94, 52, 52, 52, 52, 86, 131, 94, 94, 94, 94, 94, 83, 83, 83, 83, 83, 83, 83, 83, 83, 83, 83, 83, 83, 83, 83, 83, 83, 83, 83, 83, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 125, 125, 125, 93, 114, 114, 16, 16, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 134, 134, 134, 134, 5, 5, 35, 35, 35, 35, 35, 125, 125, 125, 125, 4, 4, 4, 16, 16, 16, 16, 16, 16, 83, 83, 83, 83, 83, 83, 83, 83, 83, 83, 83, 45,
+#> 45, 45, 45, 45, 45, 45, 131, 131, 131, 131, 131, 131, 38, 131, 38, 38, 38, 58, 131, 83, 83, 83, 83, 83, 83, 83, 125, 114, 102, 114, 102, 106, 96, 96, 35, 35, 35, 35, 102, 102, 102, 102, 45, 86, 117, 117, 35, 35, 35, 38, 114, 114, 114, 114, 114, 114, 114, 114, 93, 93, 93, 93, 93, 93, 93, 93, 30, 93, 30, 134, 79, 79, 45, 5, 5, 5, 5, 5, 5, 96, 30, 30, 30, 30, 30, 30, 93, 93, 93, 16, 16, 79, 96, 35, 35, 35, 35, 86, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 131, 131, 131, 33, 38, 33,
+#> 83, 102, 83, 45, 79, 79, 79, 79, 79, 79, 45, 45, 45, 134, 134, 134, 134, 134, 134, 96, 96, 96, 72, 72, 72, 72, 134, 134, 72, 72, 72, 72, 72, 45, 45, 35, 45, 35, 35, 35, 35, 35, 35, 35, 5, 5, 125, 83, 83, 83, 83, 83, 83, 66, 66, 66, 66, 125, 125, 125, 125, 125, 131, 131, 94, 94, 86, 86, 86, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 131, 79, 131, 79, 79, 79, 79, 79, 79, 93, 93, 33, 93, 79, 79, 79, 117, 117, 117, 117, 94, 94, 30, 93, 94, 114, 35, 35, 35, 94, 94, 94, 96, 96, 96, 106, 106, 106, 106, 106, 106, 106,
+#> 106, 58, 93, 93, 66, 93, 4, 35, 35, 35, 114, 52, 52, 52, 4, 4, 58, 58, 58, 58, 58, 58, 58, 58, 58, 58, 58, 93, 93, 79, 93, 79, 94, 94, 94, 94, 94, 94, 94, 94, 94, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 117, 117, 33, 35, 35, 35, 33, 33, 5, 5, 5, 96, 96, 96, 96, 96, 96, 96, 96, 96, 96, 52, 102, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 96, 96, 35, 35, 96, 96, 96, 96, 96, 96, 96, 96, 96, 96, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52,
+#> 38, 38, 38, 94, 94, 94, 94, 94, 86, 131, 86, 86, 52, 86, 86, 86, 86, 86, 86, 86, 86, 86, 86, 86, 86, 94, 94, 94, 94, 94, 117, 72, 86, 114, 114, 114, 114, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 125, 125, 117, 45, 45, 45, 72, 72, 72, 72, 72, 79, 131, 93, 93, 93, 93, 93, 93, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 102, 102, 30, 30, 30, 30, 116, 45, 106, 134, 16, 16, 16, 52, 52, 52, 52, 83, 83, 83, 83, 83, 83, 83, 83, 83, 96,
+#> 96, 45, 45, 45, 45, 114, 114, 125, 125, 125, 125, 125, 125, 125, 30, 106, 30, 30, 30, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 58, 125, 58, 45, 45, 134, 134, 134, 93, 93, 93, 93, 93, 4, 83, 93, 16, 16, 93, 94, 86, 125, 125, 131, 131, 45, 131, 45, 45, 106, 106, 106, 106, 106, 131, 38, 38, 38, 38, 38, 38, 38, 38, 38, 102, 38, 102, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 35, 35, 35, 35, 96, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 30, 5, 102, 114, 114, 114, 125,
+#> 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 96, 96, 96, 96, 96, 96, 93, 93, 93, 93, 93, 96, 96, 96, 96, 96, 134, 96, 96, 114, 2, 114, 96, 94, 94, 116, 114, 16, 72, 35, 35, 35, 35, 35, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 131, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 117, 117, 117, 96, 134, 33, 30, 30, 30, 16, 16, 96, 96, 96, 96, 96, 96, 96, 96, 96, 96, 106, 96, 96, 96, 96, 96, 96, 16, 16, 16, 16, 30, 30, 30, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 79, 134, 134, 45, 72, 72, 72, 72,
+#> 72, 72, 72, 72, 72, 72, 72, 125, 125, 125, 125, 125, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 116, 33, 33, 134, 125, 125, 125, 83, 83, 83, 83, 83, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 102, 102, 102, 51, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 72, 72, 72, 72, 72, 72, 72, 72, 93, 93, 93, 33, 33, 96, 93, 93, 134, 134, 134, 134, 134, 134, 134, 4, 86, 5, 5, 5, 5, 5, 5, 5, 5, 5, 30, 30, 30, 30, 30, 30, 125, 125, 35, 35, 35, 35, 35, 35, 35, 35, 38, 125, 106,
+#> 106, 106, 106, 106, 106, 106, 106, 106, 106, 117, 117, 117, 117, 117, 30, 102, 72, 72, 35, 72, 35, 79, 79, 79, 79, 30, 30, 30, 30, 30, 83, 83, 83, 83, 83, 83, 83, 83, 83, 45, 83, 116, 116, 83, 116, 134, 134, 134, 134, 134, 134, 134, 134, 134, 134, 134, 134, 134, 134, 33, 134, 102, 102, 102, 102, 125, 125, 125, 66, 125, 66, 66, 4, 4, 4, 4, 4, 5, 106, 5, 86, 86, 86, 86, 86, 86, 86, 86, 86, 86, 86, 86, 86, 5, 5, 5, 5, 5, 5, 5, 5, 5, 16, 16, 16, 66, 66, 83, 79, 79, 79, 79, 93, 93, 93, 5, 93, 5, 5, 5,
+#> 5, 5, 5, 5, 5, 5, 5, 45, 72, 72, 72, 83, 5, 33, 33, 33, 33, 33, 33, 114, 114, 125, 125, 125, 125, 125, 125, 45, 45, 45, 102, 102, 102, 102, 38, 102, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 106, 106, 106, 106, 106, 106, 106, 125, 125, 125, 16, 16, 16, 16, 45, 45, 45, 33, 58, 125, 125, 125, 125, 125, 125, 125, 125, 96, 125, 117, 117, 117, 117, 16, 125, 125, 125, 125, 38, 38, 38, 38, 38, 38, 58, 58, 58, 94, 94, 94, 5, 52, 106, 117, 117, 117, 117, 102, 102, 30, 102, 106, 93, 93, 33,
+#> 33, 33, 33, 33, 93, 93, 45, 33, 5, 33, 33, 94, 94, 94, 94, 94, 94, 94, 94, 72, 72, 72, 117, 93, 93, 93, 93, 93, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 93, 93, 93, 93, 93, 130, 130, 134, 134, 134, 134, 134, 134, 134, 134, 134, 134, 52, 52, 106, 106, 106, 106, 106, 106, 30, 106, 30, 30, 30, 125, 125, 125, 114, 114, 114, 114, 114, 114, 5, 5, 117, 117, 117, 125, 125, 125, 125, 125, 58, 58, 58, 58, 58, 58, 58, 58, 58, 58, 58, 58, 58, 93, 30, 30, 58, 58, 58, 58, 58, 58, 58, 114, 102, 102, 102, 131,
+#> 83, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 96, 96, 4, 4, 4, 4, 4, 106, 106, 106, 106, 106, 4, 125, 66, 102, 66, 86, 86, 86, 86, 86, 86, 86, 86, 86, 86, 86, 86, 33, 33, 33, 33, 33, 93, 93, 93, 96, 5, 86, 55, 35, 35, 35, 35, 35, 35, 35, 35, 16, 16, 16, 125, 125, 125, 93, 125, 5, 30, 30, 38, 86, 52, 52, 52, 52, 52, 52, 52, 52, 52, 72, 72, 72, 66, 106, 52, 52, 52, 35, 35, 35, 35, 35, 35, 35, 102, 52, 52, 52, 52, 52, 52, 102, 102, 102, 102, 35, 35, 35, 35, 102, 102, 58, 58, 58, 58, 58, 58, 125, 125, 125, 125,
+#> 125, 96, 96, 58, 116, 116, 116, 116, 116, 116, 116, 116, 30, 94, 94, 94, 94, 94, 94, 94, 94, 94, 94, 94, 93, 93, 45, 45, 58, 93, 130, 114, 114, 114, 114, 114, 114, 114, 114, 114, 114, 114, 114, 114, 114, 114, 114, 114, 114, 114, 114, 72, 72, 72, 72, 72, 106, 106, 106, 106, 106, 106, 106, 106, 93, 93, 58, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 114, 114, 114, 52, 114, 52, 5, 5, 117, 66, 66, 66, 66, 66, 66, 66, 66, 94, 94, 94, 51, 94, 16, 16, 16, 16, 30, 30, 30, 30, 30, 30, 52, 52,
+#> 131, 131, 52, 114, 86, 86, 86, 86, 86, 86, 86, 86, 86, 86, 86, 86, 86, 72, 72, 72, 30, 72, 94, 94, 86, 94, 86, 86, 86, 86, 86, 79, 79, 79, 16, 16, 4, 16, 38, 93, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 4, 5, 4, 130, 125, 125, 125, 125, 125, 125, 94, 94, 94, 66, 66, 116, 38, 52, 134, 134, 134, 134, 134, 134, 134, 134, 134, 35, 33, 33, 94, 94, 94, 94, 94, 86, 86, 86, 86, 86, 72, 94, 30, 66, 66, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 131, 96, 131, 96, 96, 5, 5, 5, 33, 5, 33, 5, 5, 45, 5,
+#> 33, 33, 116, 116, 116, 116, 116, 102, 5, 5, 33, 125, 125, 125, 125, 125, 125, 125, 125, 125, 79, 125, 102, 94, 102, 94, 117, 16, 16, 16, 16, 16, 106, 125, 125, 125, 72, 125, 72, 125, 16, 16, 16, 16, 16, 16, 16, 16, 16, 114, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 134, 134, 93, 93, 93, 93, 93, 58, 58, 58, 93, 94, 94, 94, 94, 58, 58, 58, 58, 58, 58, 58, 58, 58, 79, 79, 79, 79, 79, 79, 79, 79, 79, 79, 30, 30, 30, 66, 66, 66, 125, 125, 35, 125, 35, 16, 134, 134, 134, 134, 134, 134, 134, 134,
+#> 93, 134, 93, 93, 93, 79, 79, 79, 79, 79, 79, 79, 79, 79, 79, 79, 79, 134, 134, 134, 134, 134, 134, 134, 134, 114, 114, 94, 134, 38, 93, 45, 134, 134, 78, 134, 35, 35, 35, 35, 35, 35, 35, 4, 35, 4, 4, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 125, 125, 125, 125, 125, 125, 72, 72, 72, 72, 72, 96, 96, 96, 96, 96, 96, 96, 96, 131, 131, 131, 16, 16, 96, 134, 130, 93, 130, 33, 58, 58, 58, 58, 58, 58, 58, 5, 5, 5, 86, 86, 33, 33, 33, 116, 45, 45, 45, 45, 96, 52, 16, 16, 16, 16, 16, 16, 16, 16, 16,
+#> 16, 16, 58, 125, 125, 83, 83, 83, 83, 83, 83, 83, 83, 83, 79, 79, 79, 79, 79, 79, 79, 79, 94, 94, 94, 16, 16, 16, 38, 134, 4, 4, 4, 4, 4, 102, 102, 102, 102, 117, 117, 79, 4, 4, 4, 116, 116, 116, 116, 116, 86, 116, 30, 30, 30, 30, 30, 30, 30, 2, 114, 45, 125, 125, 125, 125, 125, 125, 125, 4, 4, 4, 4, 55, 4, 55, 38, 66, 102, 125, 125, 106, 106, 106, 106, 106, 106, 33, 106, 33, 33, 38, 38, 38, 38, 38, 38, 38, 38, 72, 52, 72, 52, 38, 5, 5, 125, 125, 117, 83, 83, 83, 83, 83, 83, 83, 83, 83, 83, 83, 83,
+#> 83, 83, 83, 134, 134, 134, 79, 79, 79, 72, 58, 58, 58, 58, 117, 117, 117, 117, 117, 117, 117, 83, 117, 116, 116, 96, 96, 96, 96, 96, 96, 96, 96, 96, 96, 96, 96, 125, 125, 125, 125, 125, 114, 114, 114, 114, 114, 114, 114, 55, 55, 38, 102, 134, 134, 35, 38, 117, 117, 117, 66, 106, 117, 52, 52, 52, 52, 52, 93, 93, 93, 93, 93, 5, 51, 102, 102, 102, 102, 102, 102, 94, 102, 72, 72, 66, 72, 38, 52, 52, 66, 134, 134, 134, 134, 134, 134, 134, 134, 134, 134, 134, 134, 93, 93, 93, 93, 5, 5, 4, 4, 4, 4, 4, 4,
+#> 86, 86, 106, 106, 106, 106, 106, 16, 106, 45, 45, 45, 16, 16, 16, 16, 16, 16, 16, 35, 35, 35, 96, 96, 96, 96, 96, 96, 96, 96, 96, 125, 125, 16, 96, 96, 96, 96, 96, 96, 96, 96, 96, 96, 96, 79, 79, 79, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 45, 45, 45, 117, 94, 72, 116, 116, 116, 116, 116, 116, 116, 116, 116, 116, 5, 30, 30, 30, 30, 30, 30, 30, 134, 134, 134, 134, 134, 55, 55, 3, 72, 72, 78, 125, 125, 125, 125, 106, 106, 106, 106, 106, 106, 106, 106, 5, 102, 38, 38, 38, 38, 38, 38, 38, 38,
+#> 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 94, 94, 94, 94, 94, 94, 94, 94, 94, 94, 94, 94, 94, 94, 58, 96, 96, 96, 96, 96, 96, 55, 51, 51, 51, 51, 4, 4, 4, 38, 38, 38, 38, 38, 38, 5, 33, 125, 38, 102, 45, 45, 45, 45, 45, 45, 131, 131, 131, 131, 131, 33, 45, 45, 83, 130, 4, 4, 4, 4, 4, 94, 4, 94, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 86, 86, 86, 86, 86, 86, 86, 125, 51, 51, 51, 51, 51, 4, 4, 117, 131, 86, 117, 2, 33, 106, 106, 106, 106, 106, 106, 94, 94, 94, 5, 94, 5, 55, 55, 72, 94, 4,
+#> 125, 94, 94, 94, 83, 83, 72, 72, 38, 72, 93, 93, 93, 116, 116, 131, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 16, 134, 134, 134, 134, 134, 134, 134, 134, 134, 134, 134, 134, 4, 5, 72, 72, 72, 72, 131, 131, 102, 131, 96, 102, 96, 96, 96, 96, 96, 96, 134, 134, 96, 117, 117, 117, 117, 117, 117, 117, 117, 131, 131, 131, 131, 131, 5, 5, 125, 66, 66, 66, 66, 66, 38, 38, 38, 35, 35, 106, 102, 102, 125, 125, 114, 125, 114, 114, 114, 114, 94, 94, 94, 94, 94, 66, 66, 94, 66,
+#> 66, 66, 66, 66, 33, 33, 30, 102, 102, 117, 117, 117, 117, 114, 117, 114, 114, 66, 66, 4, 66, 102, 114, 114, 83, 94, 94, 94, 94, 94, 94, 94, 94, 86, 94, 96, 96, 96, 96, 96, 114, 114, 114, 114, 114, 114, 117, 117, 117, 94, 94, 114, 117, 117, 117, 117, 117, 116, 38, 38, 16, 38, 45, 96, 38, 38, 131, 131, 131, 131, 131, 131, 131, 96, 131, 16, 16, 45, 131, 131, 5, 5, 5, 5, 5, 5, 4, 45, 66, 52, 58, 66, 79, 3, 3, 72, 72, 35, 35, 35, 35, 30, 38, 38, 4, 5, 130, 134, 134, 134, 134, 134, 114, 114, 4, 114, 4,
+#> 4, 4, 4, 130, 130, 130, 35, 130, 35, 72, 130, 96, 96, 96, 96, 5, 5, 5, 52, 52, 52, 52, 131, 131, 131, 131, 131, 131, 131, 131, 131, 96, 131, 96, 96, 93, 96, 52, 93, 38, 134, 33, 131, 131, 116, 93, 131, 93, 93, 79, 52, 52, 52, 94, 94, 94, 94, 94, 94, 94, 94, 94, 51, 35, 58, 58, 58, 58, 58, 58, 58, 58, 58, 58, 58, 58, 58, 58, 58, 58, 58, 58, 58, 58, 30, 30, 30, 30, 30, 30, 30, 30, 30, 30, 30, 2, 2, 2, 45, 45, 45, 125, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 117, 35, 106, 45, 117, 94, 125, 125,
+#> 117, 117, 35, 35, 58, 58, 58, 58, 106, 38, 38, 16, 38, 16, 16, 102, 131, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 96, 96, 96, 96, 96, 96, 96, 93, 106, 106, 106, 106, 106, 106, 58, 58, 58, 58, 33, 5, 134, 134, 134, 134, 134, 134, 134, 134, 134, 30, 114, 114, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 33, 33, 51, 33, 33, 131, 33, 72, 94, 16, 16, 16, 16, 16, 16, 33, 51, 51, 51, 51, 51, 117, 117, 117, 45, 45, 45, 16, 116, 116, 116, 116, 116, 116, 116, 116, 116, 116, 116, 38, 38, 38, 38, 38, 38, 38, 38,
+#> 33, 38, 116, 116, 106, 106, 106, 106, 106, 106, 106, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 35, 35, 35, 35, 35, 35, 35, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 35, 35, 35, 72, 114, 72, 114, 72, 72, 72, 106, 106, 106, 106, 106, 106, 4, 4, 4, 58, 38, 38, 38, 38, 38, 38, 33, 83, 94, 94, 94, 94, 94, 38, 38, 114, 35, 35, 35, 5, 5, 114, 134, 33, 33, 33, 33, 33, 33, 33, 33, 102, 116, 4, 4, 4, 4, 4, 4, 4, 4, 45, 45, 45, 45, 93, 93, 96, 134, 134, 134, 134, 52, 52, 52, 52, 52,
+#> 52, 52, 93, 93, 2, 45, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 45, 3, 3, 3, 3, 3, 3, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 93, 96, 96, 96, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 94, 94, 94, 94, 94, 4, 114, 114, 114, 134, 134, 134, 134, 134, 5, 5, 5, 45, 45, 45, 94, 33, 94, 3, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 94, 94, 94, 93, 72, 93, 72, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 83, 83, 83, 83, 83,
+#> 83, 83, 83, 83, 83, 83, 79, 79, 79, 79, 79, 79, 79, 79, 79, 79, 79, 79, 79, 79, 4, 4, 4, 4, 4, 4, 4, 16, 16, 38, 52, 30, 30, 30, 30, 30, 30, 55, 55, 55, 79, 79, 79, 79, 79, 79, 79, 93, 93, 93, 93, 66, 58, 58, 58, 58, 58, 58, 58, 58, 58, 58, 58, 58, 58, 58, 58, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 96, 134, 96, 134, 35, 45, 45, 45, 45, 45, 45, 114, 134, 134, 134, 134, 134, 134, 134, 5, 117, 4, 4, 4, 4, 4, 4, 4, 38, 125, 125, 125, 102, 2, 102, 51, 96, 114, 96, 30, 30, 30,
+#> 30, 93, 93, 30, 33, 30, 33, 78, 131, 131, 131, 131, 131, 131, 131, 131, 131, 131, 131, 131, 55, 52, 52, 52, 52, 52, 93, 58, 131, 137, 137, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 3, 3, 3, 106, 106, 106, 106, 106, 106, 66, 66, 30, 66, 86, 86, 86, 86, 86, 86, 51, 51, 51, 51, 51, 51, 51, 51, 51, 51, 125, 125, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 16, 125, 83, 83, 83, 83, 83, 58, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 35, 96, 116, 116, 116, 116, 116, 116, 116,
+#> 116, 116, 116, 116, 116, 116, 116, 116, 116, 116, 116, 131, 131, 131, 131, 131, 131, 131, 131, 131, 131, 131, 52, 45, 131, 131, 66, 45, 52, 52, 52, 52, 52, 52, 52, 52, 45, 45, 45, 45, 45, 83, 83, 83, 83, 114, 55, 114, 55, 55, 55, 55, 55, 72, 72, 72, 72, 4, 4, 93, 93, 93, 52, 52, 94, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 55, 102, 116, 116, 116, 116, 66, 116, 72, 72, 5, 5, 5, 5, 5, 5, 4, 33, 5, 131, 72, 33, 33, 33, 33, 33, 33, 33, 93, 45, 45, 2, 2, 83, 45, 45, 45, 45, 45,
+#> 45, 58, 58, 102, 5, 35, 83, 83, 45, 78, 96, 96, 134, 134, 134, 134, 134, 134, 134, 58, 66, 30, 33, 125, 45, 45, 45, 134, 116, 116, 116, 79, 116, 116, 58, 45, 45, 45, 45, 45, 4, 45, 45, 45, 45, 33, 117, 35, 106, 93, 102, 72, 45, 131, 116, 116, 116, 116, 116, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 117, 117, 117, 117, 131, 33, 33, 134, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 58, 117, 51, 51, 51, 86, 86, 86, 86, 86, 86, 4, 4, 45, 78, 78,
+#> 78, 72, 72, 117, 117, 117, 45, 45, 45, 106, 106, 106, 106, 106, 106, 106, 106, 66, 3, 3, 3, 3, 3, 94, 134, 134, 134, 134, 134, 134, 134, 134, 94, 94, 94, 116, 116, 116, 116, 93, 116, 16, 5, 5, 5, 58, 102, 102, 102, 102, 102, 102, 102, 102, 3, 102, 3, 3, 3, 16, 16, 16, 16, 38, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 30, 30, 30, 30, 30, 2, 2, 2, 2, 2, 2, 2, 2, 71, 72, 72, 72, 72, 72, 72, 55, 72, 94, 94, 94, 94, 94, 94, 94, 94, 114, 96, 45, 45, 45, 45, 45, 45, 45, 94, 94, 94, 45, 114, 16, 3,
+#> 3, 137, 131, 131, 131, 131, 131, 131, 93, 93, 93, 93, 16, 16, 93, 16, 134, 16, 16, 96, 45, 45, 45, 45, 45, 45, 45, 45, 33, 33, 5, 5, 94, 94, 94, 94, 94, 102, 102, 102, 102, 102, 102, 102, 102, 66, 94, 94, 94, 94, 94, 94, 134, 66, 66, 93, 134, 93, 93, 93, 93, 93, 16, 94, 96, 117, 117, 117, 117, 38, 117, 33, 33, 72, 16, 16, 16, 16, 35, 117, 117, 117, 117, 117, 117, 117, 35, 16, 35, 16, 16, 114, 114, 66, 66, 66, 66, 52, 78, 72, 72, 72, 72, 72, 72, 72, 134, 134, 93, 134, 3, 93, 2, 106, 4, 86, 106, 86,
+#> 86, 86, 86, 86, 55, 58, 58, 58, 35, 35, 35, 117, 117, 94, 94, 79, 79, 79, 79, 58, 58, 58, 58, 58, 117, 38, 117, 38, 102, 102, 16, 86, 86, 86, 86, 16, 16, 33, 45, 45, 106, 45, 45, 86, 86, 55, 137, 66, 66, 55, 55, 55, 55, 55, 66, 5, 5, 5, 5, 5, 55, 55, 55, 5, 102, 38, 94, 86, 86, 116, 116, 116, 116, 116, 116, 116, 116, 116, 58, 116, 3, 3, 3, 3, 3, 3, 93, 93, 3, 3, 117, 93, 30, 30, 30, 30, 117, 117, 117, 117, 117, 117, 117, 117, 117, 16, 117, 58, 58, 58, 58, 58, 58, 58, 58, 114, 114, 114, 114, 58, 58,
+#> 4, 131, 55, 55, 55, 55, 55, 72, 5, 5, 33, 55, 55, 51, 51, 130, 5, 5, 58, 58, 58, 58, 114, 114, 114, 114, 3, 3, 3, 3, 3, 3, 72, 71, 117, 51, 16, 16, 16, 16, 16, 16, 16, 16, 2, 2, 94, 94, 5, 5, 5, 5, 45, 45, 45, 45, 45, 45, 45, 117, 116, 116, 102, 102, 102, 106, 106, 51, 52, 102, 131, 131, 131, 134, 134, 134, 134, 134, 134, 134, 134, 131, 131, 125, 79, 79, 79, 79, 79, 134, 45, 5, 5, 72, 72, 72, 72, 94, 78, 52, 16, 72, 72, 72, 130, 66, 45, 45, 45, 45, 45, 45, 45, 45, 16, 16, 16, 16, 16, 16, 16, 16,
+#> 72, 72, 33, 72, 130, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 94, 4, 4, 51, 51, 51, 51, 51, 51, 51, 130, 58, 130, 4, 4, 51, 137, 51, 114, 30, 30, 30, 83, 83, 51, 51, 51, 51, 51, 51, 51, 16, 38, 16, 33, 131, 33, 33, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 5, 131, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 102, 102, 102, 33, 33, 33, 33, 72, 79, 45, 79, 5, 102, 30, 30, 30, 30, 2, 2, 2, 125, 125, 125, 125, 125, 125, 125, 125, 35, 114, 38, 78, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 93, 93, 93,
+#> 93, 93, 93, 93, 93, 94, 94, 94, 38, 38, 38, 38, 16, 58, 106, 16, 16, 38, 38, 38, 38, 38, 38, 38, 38, 114, 4, 3, 117, 106, 125, 125, 66, 66, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 4, 4, 4, 45, 45, 45, 45, 117, 117, 117, 72, 72, 72, 72, 72, 94, 72, 72, 134, 134, 134, 134, 134, 134, 134, 134, 134, 125, 5, 5, 5, 134, 93, 93, 116, 116, 116, 116, 116, 116, 116, 116, 116, 116, 116, 116, 116, 116, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 5, 5, 5, 16, 72, 72, 72, 86, 86, 86, 93, 93, 131,
+#> 131, 131, 131, 117, 117, 117, 117, 117, 117, 38, 38, 38, 38, 125, 102, 102, 131, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 72, 72, 72, 72, 72, 51, 72, 51, 51, 131, 55, 35, 4, 35, 38, 45, 116, 116, 116, 116, 116, 116, 116, 131, 131, 131, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 72, 51, 51, 51, 51, 51, 72, 72, 72, 35, 35, 78, 78, 117, 131, 114, 114, 131, 93, 93, 93, 93, 93, 93, 93, 93, 93, 58, 58, 58, 93, 93, 93, 93, 93, 93, 93, 93, 93, 134, 134, 134, 134, 134,
+#> 134, 134, 55, 55, 94, 94, 94, 94, 94, 94, 94, 55, 93, 55, 114, 114, 114, 114, 114, 114, 114, 114, 114, 114, 114, 114, 114, 114, 114, 114, 78, 78, 72, 72, 86, 86, 86, 86, 16, 16, 16, 16, 16, 16, 16, 94, 94, 94, 94, 102, 35, 35, 35, 131, 131, 131, 131, 131, 5, 5, 5, 5, 5, 131, 131, 131, 131, 131, 5, 5, 94, 94, 94, 94, 94, 94, 94, 130, 35, 55, 55, 55, 55, 117, 117, 117, 117, 86, 86, 137, 3, 137, 3, 51, 79, 94, 137, 137, 137, 4, 78, 45, 45, 45, 86, 86, 33, 86, 38, 38, 38, 72, 72, 72, 72, 16, 16, 16,
+#> 16, 16, 16, 16, 16, 16, 35, 35, 72, 72, 72, 96, 102, 102, 102, 102, 102, 102, 102, 125, 125, 125, 125, 125, 125, 134, 38, 134, 38, 38, 38, 116, 116, 116, 116, 116, 116, 93, 93, 93, 93, 93, 93, 125, 125, 130, 93, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 35, 35, 79, 106, 106, 106, 106, 4, 106, 4, 4, 38, 38, 93, 51, 51, 51, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 134, 134, 134, 134, 134, 134, 52, 52, 38, 52, 5, 93, 93, 134, 134, 33, 93, 93, 114, 16, 16, 114, 72, 114, 96,
+#> 96, 96, 96, 96, 96, 96, 93, 93, 93, 93, 116, 116, 38, 38, 38, 38, 38, 4, 114, 116, 116, 116, 116, 79, 116, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 72, 131, 33, 93, 93, 93, 93, 93, 93, 116, 114, 114, 114, 114, 93, 114, 93, 93, 125, 114, 66, 66, 66, 66, 66, 66, 66, 66, 16, 16, 16, 16, 35, 35, 58, 33, 93, 93, 102, 102, 102, 3, 96, 96, 96, 96, 130, 130, 130, 35, 78, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 45, 45, 93, 35, 35, 30, 30, 30, 30, 30, 52, 52, 52, 52, 52, 52, 52, 130, 55, 55, 3, 94, 94, 131,
+#> 131, 131, 131, 131, 131, 131, 66, 131, 66, 52, 52, 52, 52, 52, 83, 83, 83, 83, 83, 83, 83, 83, 114, 114, 114, 38, 130, 130, 130, 51, 131, 131, 131, 131, 131, 131, 131, 131, 5, 55, 55, 114, 72, 72, 72, 72, 72, 93, 93, 93, 93, 93, 93, 93, 93, 33, 3, 94, 94, 134, 134, 134, 134, 134, 134, 134, 72, 72, 72, 72, 72, 3, 3, 94, 94, 38, 38, 38, 38, 38, 106, 106, 16, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 72, 45, 38, 38, 38, 38, 38, 38, 38, 38, 52, 106, 52, 16, 4, 4, 4, 4, 4, 4, 4,
+#> 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 45, 78, 4, 4, 58, 58, 58, 58, 58, 58, 58, 58, 58, 102, 102, 94, 94, 94, 16, 94, 4, 66, 66, 66, 66, 66, 66, 58, 66, 94, 94, 94, 94, 94, 94, 94, 117, 125, 125, 93, 93, 38, 38, 38, 38, 16, 38, 16, 35, 35, 114, 5, 134, 134, 134, 134, 134, 134, 134, 134, 134, 134, 134, 134, 55, 94, 94, 94, 94, 94, 94, 94, 94, 94, 94, 94, 94, 117, 117, 117, 71, 134, 86, 86, 86, 86, 86, 86, 86, 86, 2, 71, 71, 71, 71, 71, 131, 5, 116, 58, 58, 58, 58, 58, 58, 94, 51,
+#> 51, 4, 4, 4, 4, 58, 3, 35, 35, 35, 131, 131, 125, 5, 5, 5, 16, 116, 116, 116, 116, 116, 116, 116, 116, 116, 116, 102, 116, 102, 102, 102, 102, 51, 52, 52, 52, 58, 58, 58, 58, 52, 58, 52, 66, 72, 66, 94, 86, 86, 86, 86, 86, 86, 16, 86, 16, 55, 131, 52, 52, 102, 134, 134, 134, 134, 134, 134, 134, 96, 125, 125, 125, 131, 3, 3, 3, 4, 66, 66, 66, 66, 66, 96, 96, 96, 96, 33, 33, 33, 33, 33, 30, 2, 2, 2, 2, 2, 2, 2, 2, 71, 71, 33, 58, 58, 131, 131, 131, 131, 131, 131, 131, 93, 93, 96, 94, 96, 131, 131,
+#> 131, 79, 131, 131, 52, 52, 52, 83, 83, 83, 83, 78, 134, 125, 125, 125, 125, 125, 117, 117, 51, 51, 51, 51, 51, 51, 66, 66, 117, 35, 117, 35, 35, 52, 52, 51, 51, 51, 51, 51, 51, 51, 51, 51, 51, 51, 51, 51, 51, 51, 51, 51, 96, 96, 96, 96, 96, 96, 96, 93, 93, 93, 93, 93, 93, 93, 51, 96, 51, 51, 51, 45, 45, 94, 134, 94, 94, 94, 45, 94, 117, 117, 117, 117, 117, 117, 58, 58, 72, 72, 72, 72, 58, 58, 58, 58, 52, 52, 52, 52, 52, 79, 51, 16, 51, 38, 102, 55, 52, 52, 52, 55, 55, 55, 55, 55, 35, 35, 4, 55, 131,
+#> 102, 116, 116, 116, 116, 4, 4, 4, 4, 4, 4, 72, 72, 72, 72, 72, 72, 125, 125, 76, 2, 2, 2, 2, 2, 2, 2, 3, 134, 134, 125, 125, 4, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 33, 33, 33, 33, 33, 33, 33, 33, 52, 52, 52, 52, 52, 52, 52, 55, 55, 55, 125, 125, 125, 125, 125, 125, 16, 4, 4, 52, 117, 117, 38, 79, 79, 79, 79, 79, 79, 16, 79, 94, 66, 93, 106, 72, 96, 96, 96, 96, 96, 96, 96, 96, 96, 96, 96, 96, 96, 93, 93, 3, 3, 33, 33, 33, 33, 38, 116, 116, 116, 116, 94, 94, 114, 114,
+#> 78, 78, 16, 16, 55, 79, 79, 79, 79, 79, 79, 79, 79, 79, 79, 79, 71, 71, 71, 71, 71, 52, 52, 79, 116, 116, 116, 116, 116, 116, 116, 116, 116, 116, 116, 93, 116, 93, 93, 76, 116, 94, 83, 83, 83, 78, 78, 125, 125, 125, 125, 52, 114, 114, 114, 52, 114, 58, 58, 52, 52, 58, 58, 58, 58, 58, 58, 58, 58, 72, 72, 86, 86, 86, 86, 86, 86, 86, 16, 86, 71, 71, 71, 33, 79, 96, 38, 45, 117, 51, 51, 55, 55, 55, 72, 3, 3, 3, 3, 78, 3, 3, 78, 78, 78, 78, 78, 5, 5, 5, 5, 5, 94, 94, 94, 94, 93, 94, 116, 55, 117, 117,
+#> 55, 117, 134, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 71, 71, 71, 71, 58, 58, 58, 58, 58, 35, 58, 35, 58, 52, 3, 3, 3, 3, 3, 3, 3, 3, 72, 55, 117, 117, 117, 117, 117, 117, 117, 117, 117, 114, 116, 38, 38, 117, 117, 117, 96, 96, 96, 96, 96, 125, 125, 125, 125, 55, 131, 55, 55, 55, 55, 117, 117, 117, 117, 117, 125, 2, 2, 2, 2, 2, 71, 71, 125, 125, 96, 137, 116, 72, 72, 72, 72, 30, 30, 30, 114, 114, 94, 114, 94, 116, 96, 96, 96, 96, 96, 96, 96, 117, 117, 117, 117, 117, 117, 117, 96, 2,
+#> 2, 2, 2, 2, 2, 2, 71, 134, 117, 117, 117, 117, 131, 45, 38, 45, 38, 38, 38, 38, 38, 38, 38, 38, 94, 45, 96, 96, 96, 96, 96, 96, 96, 5, 5, 5, 5, 58, 58, 5, 114, 117, 66, 134, 134, 134, 96, 33, 33, 55, 134, 134, 134, 134, 16, 134, 16, 130, 93, 106, 4, 4, 4, 3, 51, 51, 51, 51, 51, 51, 58, 131, 131, 93, 93, 93, 93, 93, 131, 131, 137, 35, 35, 35, 35, 35, 35, 35, 93, 93, 30, 30, 30, 2, 2, 2, 2, 2, 2, 2, 2, 71, 71, 71, 71, 4, 72, 16, 116, 16, 16, 16, 16, 16, 16, 16, 72, 72, 72, 72, 4, 4, 4, 45, 93, 131,
+#> 55, 55, 55, 55, 55, 16, 16, 16, 16, 16, 16, 16, 72, 72, 72, 134, 134, 134, 134, 134, 134, 134, 134, 134, 134, 134, 134, 102, 102, 102, 102, 72, 72, 72, 72, 72, 72, 72, 72, 16, 131, 78, 114, 55, 55, 55, 55, 55, 55, 35, 35, 35, 35, 35, 35, 4, 35, 5, 106, 55, 55, 55, 55, 55, 55, 55, 55, 55, 55, 79, 79, 94, 94, 94, 94, 116, 134, 134, 134, 134, 134, 134, 117, 130, 3, 16, 72, 72, 114, 58, 33, 117, 33, 33, 33, 33, 33, 96, 16, 16, 16, 96, 66, 66, 66, 66, 66, 66, 66, 72, 93, 94, 55, 55, 55, 55, 55, 52, 52,
+#> 3, 52, 38, 117, 117, 117, 117, 117, 35, 35, 117, 16, 16, 16, 72, 134, 134, 134, 134, 134, 134, 134, 134, 134, 134, 134, 134, 71, 71, 93, 86, 86, 86, 86, 86, 86, 86, 86, 137, 137, 116, 116, 93, 55, 55, 55, 55, 55, 55, 55, 16, 16, 16, 16, 16, 4, 4, 4, 4, 4, 4, 114, 102, 102, 102, 102, 102, 102, 102, 102, 72, 58, 114, 72, 78, 78, 5, 78, 76, 52, 79, 79, 79, 79, 79, 79, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 79, 79, 79, 79, 79, 79, 79, 79, 94, 94, 94, 94, 134, 72, 72, 72, 72, 35, 72, 35,
+#> 106, 125, 5, 5, 5, 78, 137, 38, 96, 96, 96, 96, 96, 96, 96, 3, 106, 106, 114, 106, 106, 106, 106, 16, 106, 16, 94, 94, 94, 116, 131, 131, 131, 131, 4, 131, 4, 71, 93, 93, 93, 93, 93, 93, 93, 94, 5, 94, 5, 5, 5, 5, 5, 5, 5, 5, 5, 51, 3, 45, 45, 45, 45, 45, 45, 45, 16, 45, 16, 52, 52, 52, 52, 83, 83, 83, 78, 78, 78, 78, 58, 78, 114, 114, 114, 16, 58, 58, 72, 72, 72, 72, 72, 72, 72, 72, 116, 116, 116, 116, 116, 16, 131, 131, 131, 131, 131, 102, 102, 4, 4, 4, 3, 78, 137, 58, 58, 102, 102, 102, 102, 102,
+#> 102, 102, 102, 93, 102, 93, 93, 71, 71, 71, 71, 72, 94, 106, 106, 106, 106, 106, 106, 106, 106, 106, 116, 116, 4, 116, 4, 72, 38, 72, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 125, 125, 125, 125, 125, 125, 4, 72, 72, 16, 16, 16, 16, 16, 4, 4, 106, 106, 106, 106, 106, 106, 117, 117, 117, 117, 117, 117, 72, 72, 117, 117, 117, 117, 79, 79, 79, 79, 79, 79, 79, 131, 131, 52, 52, 45, 45, 45, 45, 45, 45, 86, 33, 2, 71, 71, 71, 16, 33, 93, 96, 96, 94, 94, 134, 134, 134, 134, 134, 134,
+#> 125, 125, 125, 125, 125, 125, 125, 125, 125, 134, 134, 134, 134, 3, 3, 3, 72, 79, 114, 33, 114, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 58, 58, 58, 58, 58, 58, 58, 58, 58, 58, 102, 102, 131, 51, 86, 86, 137, 137, 137, 137, 116, 96, 96, 96, 96, 51, 51, 51, 114, 114, 71, 114, 71, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 58, 58, 58, 58, 58, 58, 58, 114, 93, 86, 86, 86, 86, 86, 86, 35, 35, 35, 35, 114, 114, 134, 55, 55, 55, 55, 55, 52, 52, 52, 52, 52, 52, 52, 52,
+#> 33, 33, 33, 33, 33, 33, 78, 78, 131, 58, 58, 58, 58, 58, 58, 76, 4, 4, 4, 4, 125, 125, 125, 35, 35, 51, 137, 3, 137, 79, 114, 114, 38, 134, 134, 38, 38, 38, 38, 137, 137, 125, 137, 3, 78, 16, 125, 78, 130, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 93, 66, 66, 66, 66, 66, 66, 96, 16, 16, 16, 16, 93, 93, 93, 93, 52, 130, 45, 131, 131, 131, 131, 131, 131, 131, 131, 131, 131, 131, 131, 131, 72, 102, 72, 72, 72, 72, 72, 72, 55, 72, 55, 94, 94, 55, 137, 125, 125, 125, 125, 102, 125, 102, 102, 52, 102, 52,
+#> 52, 52, 52, 102, 102, 102, 76, 2, 2, 2, 2, 125, 125, 125, 3, 134, 114, 114, 22, 22, 64, 5, 5, 5, 5, 5, 5, 5, 5, 52, 96, 4, 72, 3, 3, 3, 3, 3, 3, 3, 86, 86, 86, 72, 86, 72, 72, 72, 72, 35, 35, 125, 66, 66, 66, 45, 79, 79, 79, 79, 79, 79, 79, 79, 79, 79, 79, 106, 51, 51, 16, 16, 16, 3, 66, 66, 66, 66, 66, 16, 106, 125, 125, 125, 78, 78, 78, 78, 125, 114, 2, 2, 2, 71, 71, 71, 71, 94, 94, 78, 94, 78, 5, 78, 78, 78, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 16, 55, 55, 55, 55, 55, 55, 72, 76, 72, 72,
+#> 16, 93, 93, 93, 93, 93, 93, 93, 93, 93, 116, 116, 33, 33, 33, 33, 33, 33, 33, 33, 33, 79, 79, 79, 79, 79, 79, 79, 79, 79, 79, 79, 79, 79, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 72, 102, 4, 4, 4, 4, 4, 4, 4, 4, 4, 93, 93, 51, 51, 51, 51, 51, 96, 125, 125, 125, 125, 125, 125, 125, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 76, 94, 94, 94, 94, 94, 94, 94, 94, 94, 76, 134, 134, 51, 134, 94, 94, 94, 94, 94, 94, 94, 94, 94, 94, 94, 94, 58, 58, 58, 58, 58, 58, 58, 58, 58, 58, 58, 58,
+#> 93, 125, 125, 131, 16, 16, 16, 16, 16, 16, 16, 102, 102, 102, 102, 137, 131, 52, 96, 52, 52, 52, 16, 130, 130, 130, 130, 35, 130, 58, 66, 131, 125, 125, 38, 38, 38, 38, 52, 52, 52, 52, 52, 137, 137, 45, 45, 45, 45, 45, 45, 45, 45, 78, 93, 93, 93, 93, 93, 93, 93, 114, 114, 114, 114, 114, 114, 114, 33, 114, 33, 33, 33, 16, 33, 16, 117, 117, 16, 16, 16, 16, 16, 16, 16, 16, 16, 33, 93, 45, 45, 45, 45, 45, 45, 45, 45, 16, 102, 102, 130, 72, 72, 72, 72, 72, 93, 93, 106, 106, 134, 4, 4, 4, 4, 4, 94, 94,
+#> 131, 66, 66, 66, 117, 114, 102, 33, 33, 33, 33, 33, 102, 102, 117, 117, 117, 117, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 72, 78, 78, 78, 78, 78, 78, 78, 52, 52, 131, 131, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 96, 116, 102, 116, 134, 134, 134, 134, 134, 134, 116, 134, 116, 5, 5, 125, 125, 102, 125, 16, 16, 16, 16, 16, 16, 116, 116, 116, 116, 116, 116, 94, 33, 3, 3, 3, 3, 3, 3, 3, 3, 3, 58, 58, 52, 52, 52, 52, 94, 16, 16, 16, 16, 16, 16, 16, 16, 16,
+#> 16, 78, 78, 78, 78, 78, 78, 78, 78, 78, 3, 3, 38, 38, 38, 3, 114, 5, 4, 4, 93, 93, 35, 35, 35, 35, 35, 130, 55, 45, 45, 79, 79, 130, 130, 130, 35, 35, 35, 131, 78, 78, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 131, 45, 45, 45, 45, 45, 45, 45, 45, 102, 116, 131, 102, 102, 102, 102, 58, 58, 58, 58, 58, 58, 102, 102, 102, 102, 137, 117, 117, 117, 117, 117, 117, 117, 117, 117, 131, 131, 114, 114, 114, 114, 114, 16, 16, 72, 72, 72, 72, 45, 45, 45, 45, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 125,
+#> 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 106, 106, 106, 106, 4, 106, 4, 4, 5, 106, 5, 137, 114, 102, 102, 102, 102, 102, 102, 102, 72, 102, 16, 16, 16, 71, 106, 106, 106, 106, 106, 35, 106, 35, 35, 35, 35, 35, 35, 35, 35, 78, 78, 78, 78, 106, 16, 16, 16, 16, 16, 16, 16, 16, 16, 96, 35, 130, 130, 130, 130, 130, 130, 130, 130, 35, 35, 35, 35, 35, 35, 35, 35, 131, 131, 96, 131, 33, 130, 130, 130, 130, 130, 130, 58, 130, 5, 5, 5, 52, 117, 117, 117, 38, 131, 131, 131, 131, 131, 71, 71, 131,
+#> 3, 3, 33, 33, 33, 33, 114, 114, 114, 131, 45, 131, 45, 45, 125, 125, 125, 114, 125, 106, 114, 38, 38, 38, 130, 130, 130, 130, 130, 130, 130, 130, 130, 16, 16, 72, 72, 72, 134, 134, 134, 134, 134, 134, 3, 134, 3, 3, 3, 3, 35, 16, 66, 66, 66, 66, 66, 66, 66, 78, 71, 78, 72, 72, 72, 116, 116, 5, 5, 5, 5, 5, 5, 5, 5, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 76, 134, 134, 134, 137, 137, 137, 137, 137, 137, 137, 137, 137, 137, 137, 102, 102, 58, 58, 58, 4, 58, 4, 45, 45, 4, 45, 72, 72, 72, 72, 72,
+#> 72, 72, 72, 72, 114, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 66, 66, 66, 66, 66, 33, 33, 134, 94, 94, 94, 114, 114, 114, 114, 114, 76, 3, 130, 96, 96, 96, 16, 16, 93, 55, 55, 55, 76, 76, 35, 35, 134, 134, 134, 134, 134, 134, 134, 134, 134, 78, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 116, 116, 116, 116, 116, 116, 38, 102, 125, 125, 125, 125, 125, 93, 93, 93, 93, 93, 93, 93, 71, 96, 130, 79, 79, 79, 79, 79, 79, 33, 79, 106, 106, 106, 96, 96, 96, 96, 96, 96, 4, 4, 4, 4, 4, 4, 4, 4, 4, 117,
+#> 117, 116, 116, 116, 116, 116, 116, 116, 116, 116, 116, 116, 45, 45, 45, 45, 116, 116, 116, 116, 116, 116, 96, 51, 51, 51, 51, 51, 51, 51, 106, 106, 106, 16, 16, 16, 38, 38, 38, 38, 38, 38, 38, 38, 3, 51, 51, 51, 51, 51, 51, 51, 51, 51, 51, 134, 5, 66, 106, 130, 106, 106, 106, 106, 134, 134, 134, 134, 134, 134, 134, 134, 38, 38, 38, 38, 38, 38, 38, 38, 38, 52, 72, 38, 55, 72, 55, 55, 55, 55, 117, 117, 16, 3, 3, 96, 106, 106, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 116,
+#> 116, 116, 116, 116, 4, 4, 4, 130, 93, 93, 137, 137, 35, 131, 131, 131, 131, 131, 131, 52, 131, 117, 117, 117, 117, 117, 117, 117, 33, 33, 33, 33, 33, 33, 33, 33, 55, 55, 55, 55, 55, 4, 4, 4, 4, 117, 137, 78, 78, 78, 78, 78, 78, 78, 78, 131, 78, 131, 131, 131, 131, 131, 131, 131, 131, 5, 116, 125, 125, 125, 125, 125, 71, 71, 16, 16, 16, 16, 16, 16, 16, 93, 93, 72, 72, 72, 72, 72, 72, 72, 72, 5, 5, 5, 5, 5, 5, 5, 66, 66, 66, 66, 66, 66, 66, 66, 66, 5, 5, 5, 5, 5, 5, 5, 5, 5, 4, 71, 71, 71, 71, 71,
+#> 71, 71, 71, 71, 71, 3, 3, 3, 3, 3, 3, 78, 5, 78, 66, 66, 66, 66, 66, 66, 66, 66, 96, 78, 78, 78, 78, 78, 125, 45, 106, 51, 130, 130, 130, 130, 130, 3, 4, 4, 4, 4, 4, 114, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 93, 93, 93, 93, 94, 94, 45, 45, 45, 45, 45, 45, 45, 45, 137, 130, 3, 3, 3, 3, 3, 3, 4, 4, 114, 33, 3, 33, 3, 3, 3, 3, 130, 130, 79, 79, 79, 52, 79, 52, 102, 130, 5, 5, 93, 93, 93, 93, 93, 4, 66, 117, 134, 134, 33, 117, 117, 117, 117, 117, 117, 117, 16, 131, 131, 131, 131, 131,
+#> 116, 79, 94, 94, 94, 134, 134, 134, 52, 52, 52, 52, 52, 52, 52, 71, 71, 130, 130, 116, 35, 116, 130, 130, 130, 130, 130, 130, 52, 130, 52, 134, 16, 16, 16, 96, 96, 96, 96, 78, 78, 78, 78, 78, 79, 5, 5, 5, 5, 5, 4, 4, 4, 106, 106, 4, 16, 106, 3, 137, 137, 137, 137, 33, 35, 35, 35, 35, 35, 72, 72, 134, 114, 114, 114, 114, 114, 114, 114, 93, 114, 93, 106, 106, 106, 106, 106, 106, 106, 4, 4, 4, 4, 4, 125, 94, 94, 96, 96, 96, 96, 134, 134, 16, 16, 51, 117, 117, 117, 71, 71, 71, 71, 71, 137, 137, 137,
+#> 137, 79, 79, 79, 79, 79, 79, 117, 33, 33, 33, 33, 33, 33, 33, 33, 131, 16, 125, 4, 55, 55, 55, 55, 55, 137, 137, 96, 79, 79, 66, 79, 66, 66, 38, 38, 38, 38, 38, 38, 38, 38, 137, 137, 137, 137, 137, 137, 137, 137, 137, 137, 137, 137, 137, 5, 5, 5, 131, 131, 16, 16, 16, 3, 3, 52, 52, 52, 52, 52, 137, 66, 66, 66, 66, 66, 5, 5, 5, 5, 66, 66, 66, 66, 66, 3, 3, 3, 3, 3, 51, 51, 51, 94, 79, 79, 78, 78, 78, 78, 78, 58, 78, 4, 4, 4, 4, 125, 125, 125, 130, 130, 114, 76, 76, 76, 131, 131, 131, 5, 131, 5, 5,
+#> 5, 5, 125, 125, 125, 125, 125, 106, 106, 106, 106, 106, 106, 79, 79, 79, 79, 79, 79, 79, 79, 79, 79, 79, 51, 51, 51, 94, 78, 66, 66, 66, 66, 66, 114, 35, 35, 35, 35, 131, 131, 114, 114, 114, 114, 114, 94, 94, 116, 66, 35, 78, 78, 78, 93, 106, 76, 76, 117, 45, 45, 45, 45, 45, 116, 116, 116, 116, 116, 58, 58, 58, 58, 35, 51, 51, 51, 51, 94, 94, 94, 76, 76, 76, 55, 55, 76, 76, 76, 76, 117, 117, 117, 117, 117, 117, 117, 33, 33, 94, 94, 58, 58, 58, 58, 58, 134, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45,
+#> 106, 106, 106, 106, 106, 106, 106, 137, 137, 137, 78, 78, 78, 66, 66, 66, 66, 66, 94, 94, 94, 5, 5, 5, 5, 35, 35, 35, 130, 130, 130, 96, 96, 16, 96, 52, 94, 71, 71, 71, 71, 72, 72, 72, 72, 76, 3, 3, 3, 3, 106, 106, 106, 106, 117, 117, 117, 117, 117, 96, 96, 96, 96, 134, 94, 94, 94, 94, 94, 94, 94, 58, 35, 71, 71, 71, 71, 71, 71, 116, 79, 116, 66, 58, 58, 58, 52, 52, 16, 16, 16) x c(55, 72, 45, 61, 59, 65, 76, 3, 8, 37, 7, 11, 39, 59, 69, 64, 60, 62, 85, 85, 80, 84, 97, 114, 98, 121, 123, 133, 121, 69, 31, 54, 78, 81, 78, 70, 84, 91, 56, 81, 86, 6, 72, 83, 89, 87, 66, 66, 51, 24, 35, 45, 29, 23, 78, 52, 138, 124, 130, 134, 137, 129, 109, 12, 46, 53, 70, 62, 47, 64, 56, 51, 47, 30, 8, 11, 39, 22, 3, 21, 72, 55, 63, 55, 73, 45, 55, 16, 29, 37, 22, 33, 73, 62, 70, 56, 56, 53, 40, 41, 3, 71, 136, 138, 127, 147, 131, 125, 130, 131, 134, 152, 147, 55, 79, 18, 15, 1, 17, 55, 53,
+#> 53, 52, 47, 53, 48, 47, 44, 41, 45, 45, 41, 43, 38, 40, 46, 36, 35, 21, 11, 7, 39, 127, 147, 77, 102, 131, 86, 1, 125, 140, 65, 152, 137, 157, 128, 159, 90, 117, 137, 121, 129, 113, 2, 10, 30, 30, 2, 34, 39, 46, 46, 43, 44, 43, 31, 10, 6, 42, 42, 45, 48, 44, 38, 41, 56, 37, 38, 45, 43, 40, 41, 27, 1, 12, 128, 151, 125, 106, 118, 130, 133, 131, 102, 39, 75, 58, 145, 142, 152, 74, 110, 10, 145, 136, 77, 44, 141, 151, 150, 21, 97, 2, 39, 84, 77, 80, 76, 83, 96, 98, 109, 7, 75, 84, 74, 27, 1, 22, 72,
+#> 98, 76, 32, 108, 98, 118, 112, 137, 97, 45, 89, 41, 1, 1, 31, 101, 131, 140, 137, 150, 154, 145, 144, 152, 156, 154, 146, 149, 153, 157, 156, 100, 61, 2, 155, 154, 155, 148, 83, 152, 18, 29, 42, 57, 66, 32, 52, 63, 62, 17, 10, 5, 2, 4, 33, 34, 28, 35, 36, 42, 42, 33, 13, 39, 5, 5, 46, 48, 40, 46, 44, 28, 37, 30, 22, 26, 24, 6, 10, 1, 2, 41, 98, 150, 150, 156, 140, 146, 140, 122, 98, 156, 145, 152, 111, 124, 112, 128, 137, 145, 155, 121, 79, 134, 95, 4, 30, 45, 130, 154, 151, 126, 134, 133, 135, 139,
+#> 156, 139, 147, 137, 116, 138, 125, 100, 55, 26, 9, 14, 8, 32, 130, 153, 148, 143, 157, 143, 147, 95, 124, 73, 6, 2, 86, 65, 51, 113, 109, 104, 124, 110, 140, 72, 88, 81, 48, 69, 101, 77, 15, 74, 114, 132, 123, 111, 107, 104, 126, 91, 75, 27, 81, 80, 66, 78, 121, 34, 126, 60, 42, 150, 37, 155, 56, 12, 77, 35, 75, 132, 131, 128, 149, 148, 106, 129, 113, 104, 72, 141, 118, 148, 151, 152, 123, 110, 9, 2, 1, 26, 31, 31, 36, 36, 46, 50, 46, 53, 16, 39, 9, 26, 36, 12, 37, 42, 38, 41, 48, 45, 41, 16, 19,
+#> 9, 61, 151, 147, 135, 140, 136, 129, 132, 147, 142, 142, 151, 137, 150, 130, 145, 114, 150, 156, 123, 74, 27, 49, 88, 132, 117, 150, 112, 115, 134, 122, 147, 149, 143, 150, 156, 101, 102, 26, 124, 152, 99, 154, 151, 126, 127, 125, 46, 143, 136, 139, 83, 71, 24, 56, 1, 1, 41, 41, 32, 38, 52, 39, 52, 43, 41, 39, 41, 39, 33, 35, 34, 27, 46, 35, 24, 33, 39, 15, 10, 44, 33, 21, 5, 20, 123, 146, 97, 102, 140, 151, 154, 139, 132, 137, 151, 72, 55, 64, 30, 93, 6, 14, 102, 153, 153, 132, 153, 148, 152, 155,
+#> 155, 156, 97, 140, 153, 139, 154, 145, 152, 118, 106, 95, 36, 9, 3, 37, 57, 94, 114, 72, 87, 87, 82, 46, 33, 11, 3, 2, 29, 131, 137, 89, 72, 29, 1, 7, 31, 143, 141, 141, 153, 141, 158, 150, 151, 142, 127, 134, 150, 132, 131, 150, 135, 117, 150, 141, 64, 33, 36, 45, 46, 41, 26, 43, 36, 35, 38, 40, 37, 41, 34, 42, 37, 20, 14, 36, 40, 45, 42, 55, 54, 55, 64, 58, 57, 65, 56, 33, 38, 43, 42, 39, 36, 35, 26, 40, 46, 53, 47, 50, 70, 55, 53, 50, 40, 38, 12, 11, 43, 6, 6, 24, 35, 44, 43, 24, 21, 29, 10, 119,
+#> 72, 61, 66, 142, 20, 157, 142, 150, 144, 153, 157, 155, 145, 147, 128, 129, 141, 104, 23, 41, 10, 46, 81, 113, 143, 150, 143, 100, 95, 48, 102, 120, 33, 35, 4, 1, 4, 25, 34, 40, 28, 43, 40, 40, 16, 3, 34, 35, 25, 27, 26, 9, 33, 19, 53, 64, 56, 69, 75, 125, 124, 118, 136, 111, 129, 93, 88, 31, 2, 12, 1, 3, 106, 51, 98, 135, 127, 146, 131, 133, 149, 152, 151, 135, 108, 82, 28, 131, 153, 107, 30, 10, 2, 31, 38, 41, 38, 40, 41, 9, 36, 36, 4, 3, 7, 86, 64, 134, 120, 153, 136, 143, 36, 17, 28, 147, 109,
+#> 5, 6, 44, 80, 40, 84, 60, 103, 48, 22, 2, 1, 32, 67, 78, 83, 110, 117, 87, 53, 17, 24, 24, 78, 37, 46, 52, 56, 2, 5, 29, 27, 32, 46, 2, 43, 31, 38, 44, 45, 20, 40, 36, 32, 27, 48, 28, 26, 28, 20, 1, 7, 18, 80, 98, 116, 120, 111, 79, 97, 77, 2, 9, 9, 24, 95, 155, 154, 140, 143, 143, 154, 121, 132, 138, 146, 156, 122, 72, 45, 115, 56, 1, 34, 32, 8, 12, 33, 10, 9, 148, 146, 148, 149, 149, 150, 100, 146, 126, 141, 94, 69, 1, 77, 88, 141, 121, 80, 122, 100, 94, 99, 54, 38, 78, 3, 34, 37, 44, 12, 17, 18,
+#> 21, 30, 26, 5, 5, 20, 147, 154, 148, 122, 45, 83, 155, 146, 17, 139, 146, 94, 62, 108, 113, 113, 101, 133, 141, 103, 74, 69, 55, 53, 10, 46, 15, 90, 127, 133, 126, 120, 134, 110, 80, 47, 25, 50, 46, 47, 48, 49, 49, 47, 3, 30, 46, 31, 33, 39, 21, 32, 7, 23, 37, 34, 22, 9, 144, 149, 145, 139, 126, 150, 127, 125, 108, 140, 142, 136, 156, 125, 102, 69, 104, 147, 151, 143, 143, 132, 145, 150, 9, 113, 135, 75, 113, 137, 5, 14, 79, 148, 155, 122, 93, 147, 65, 150, 135, 106, 48, 50, 1, 29, 13, 45, 43, 42,
+#> 39, 6, 27, 36, 37, 34, 8, 28, 39, 39, 38, 6, 26, 19, 38, 126, 153, 148, 149, 119, 140, 150, 117, 120, 148, 152, 142, 154, 146, 59, 47, 1, 3, 19, 113, 138, 143, 131, 155, 127, 148, 146, 127, 139, 154, 153, 137, 52, 38, 33, 61, 61, 84, 62, 47, 51, 125, 96, 114, 69, 35, 27, 119, 2, 82, 10, 17, 9, 111, 153, 124, 142, 80, 144, 110, 84, 6, 3, 5, 46, 65, 99, 143, 145, 127, 146, 139, 107, 40, 150, 121, 123, 16, 118, 104, 144, 153, 145, 124, 132, 109, 149, 141, 127, 88, 139, 27, 144, 154, 146, 148, 152, 155,
+#> 154, 107, 120, 36, 41, 42, 43, 41, 33, 12, 79, 107, 116, 110, 118, 88, 113, 122, 134, 124, 84, 114, 73, 103, 97, 91, 94, 45, 30, 10, 12, 40, 33, 8, 17, 24, 37, 16, 39, 49, 7, 25, 15, 40, 124, 145, 127, 140, 134, 140, 78, 54, 94, 116, 31, 33, 137, 143, 150, 43, 94, 19, 4, 130, 147, 149, 150, 137, 140, 121, 83, 46, 26, 156, 140, 123, 138, 145, 146, 149, 109, 105, 137, 148, 148, 152, 98, 141, 150, 111, 88, 23, 129, 136, 135, 129, 140, 108, 131, 151, 128, 142, 123, 57, 125, 82, 16, 2, 5, 42, 36, 32,
+#> 48, 37, 16, 29, 28, 36, 9, 18, 26, 143, 156, 149, 155, 142, 11, 131, 134, 153, 155, 141, 152, 75, 78, 9, 112, 146, 142, 145, 149, 143, 23, 25, 100, 112, 80, 119, 119, 121, 100, 76, 108, 97, 80, 61, 66, 55, 7, 1, 6, 29, 150, 154, 155, 155, 152, 119, 139, 154, 149, 156, 154, 93, 88, 24, 49, 14, 1, 51, 150, 135, 53, 113, 90, 36, 41, 39, 6, 48, 43, 48, 32, 24, 27, 117, 4, 139, 160, 149, 156, 126, 122, 145, 97, 115, 123, 145, 25, 12, 14, 11, 7, 100, 144, 132, 115, 39, 32, 50, 87, 108, 104, 120, 118, 107,
+#> 55, 63, 153, 142, 127, 125, 92, 108, 42, 153, 156, 107, 79, 128, 127, 111, 149, 104, 10, 86, 122, 149, 153, 144, 147, 6, 58, 28, 49, 55, 151, 118, 138, 94, 109, 148, 146, 151, 136, 148, 107, 107, 131, 99, 66, 21, 1, 13, 38, 45, 16, 2, 30, 41, 12, 37, 5, 14, 81, 151, 135, 114, 132, 154, 138, 142, 151, 150, 150, 149, 118, 20, 154, 116, 5, 42, 67, 52, 95, 130, 142, 152, 110, 152, 153, 98, 152, 151, 154, 135, 145, 145, 133, 137, 125, 28, 64, 42, 106, 79, 69, 140, 96, 138, 155, 79, 77, 114, 118, 73, 52,
+#> 91, 18, 139, 145, 115, 138, 149, 154, 154, 107, 143, 138, 134, 155, 140, 156, 42, 100, 19, 11, 46, 24, 10, 2, 20, 7, 29, 4, 44, 3, 128, 118, 118, 49, 78, 80, 64, 92, 23, 53, 87, 47, 10, 16, 3, 82, 141, 150, 142, 27, 1, 134, 22, 60, 42, 147, 151, 136, 148, 151, 118, 112, 140, 151, 121, 146, 152, 53, 135, 142, 3, 40, 27, 36, 35, 9, 20, 41, 45, 40, 44, 49, 38, 40, 37, 31, 141, 106, 154, 109, 156, 128, 115, 111, 11, 74, 6, 85, 120, 98, 105, 97, 125, 104, 103, 62, 45, 9, 74, 145, 69, 39, 136, 113, 133,
+#> 149, 112, 49, 138, 121, 134, 144, 140, 46, 115, 101, 2, 129, 150, 154, 156, 140, 154, 155, 126, 66, 130, 140, 155, 153, 149, 133, 27, 86, 144, 108, 19, 6, 30, 40, 38, 44, 41, 38, 36, 44, 38, 41, 39, 38, 32, 8, 8, 9, 69, 80, 87, 121, 130, 129, 114, 125, 149, 106, 133, 113, 106, 35, 74, 10, 81, 155, 130, 147, 148, 142, 149, 151, 151, 126, 128, 139, 108, 152, 145, 130, 127, 2, 30, 26, 15, 12, 7, 42, 43, 44, 41, 35, 38, 40, 17, 131, 115, 80, 140, 152, 66, 76, 102, 147, 153, 154, 154, 135, 126, 139, 131,
+#> 98, 132, 45, 6, 42, 41, 26, 43, 37, 36, 40, 40, 34, 31, 39, 48, 33, 11, 23, 29, 30, 17, 4, 10, 8, 4, 15, 70, 1, 95, 157, 142, 145, 148, 122, 122, 139, 149, 147, 154, 155, 126, 57, 68, 7, 115, 69, 132, 150, 123, 135, 155, 149, 151, 151, 142, 146, 3, 6, 13, 70, 153, 113, 120, 107, 133, 154, 144, 153, 96, 43, 3, 1, 1, 9, 33, 53, 9, 46, 45, 42, 37, 31, 12, 37, 32, 31, 18, 4, 58, 155, 7, 141, 153, 143, 154, 148, 154, 152, 152, 142, 148, 150, 147, 120, 106, 73, 97, 5, 51, 49, 47, 37, 49, 41, 25, 21, 5,
+#> 45, 46, 38, 43, 41, 43, 35, 33, 37, 32, 36, 5, 12, 12, 26, 14, 30, 38, 47, 48, 43, 40, 41, 41, 31, 1, 144, 100, 123, 157, 126, 138, 154, 154, 154, 152, 153, 22, 33, 40, 4, 64, 72, 105, 85, 94, 114, 40, 97, 58, 37, 7, 121, 130, 153, 141, 149, 152, 133, 130, 95, 40, 50, 35, 41, 11, 25, 40, 43, 43, 33, 21, 34, 27, 18, 27, 31, 29, 44, 42, 36, 38, 48, 35, 38, 22, 13, 45, 51, 35, 23, 38, 12, 39, 14, 14, 37, 54, 110, 153, 132, 151, 145, 120, 135, 153, 141, 138, 133, 131, 115, 147, 140, 103, 93, 17, 17,
+#> 49, 11, 8, 32, 155, 149, 151, 145, 144, 147, 136, 61, 116, 147, 39, 51, 64, 43, 133, 92, 125, 137, 147, 150, 123, 89, 66, 42, 12, 23, 38, 35, 23, 13, 40, 42, 37, 34, 33, 33, 7, 2, 8, 21, 31, 32, 43, 121, 104, 123, 119, 84, 60, 146, 148, 102, 123, 112, 94, 60, 8, 1, 39, 38, 25, 41, 37, 36, 5, 45, 50, 39, 38, 60, 57, 28, 17, 3, 7, 15, 34, 46, 51, 56, 45, 52, 37, 30, 43, 32, 35, 29, 17, 23, 35, 24, 29, 38, 39, 23, 43, 40, 40, 42, 35, 39, 37, 34, 43, 35, 32, 22, 25, 16, 31, 19, 2, 42, 45, 49, 67, 49,
+#> 34, 55, 13, 47, 35, 12, 136, 151, 155, 91, 138, 153, 153, 152, 144, 153, 62, 155, 122, 95, 7, 6, 68, 101, 148, 141, 148, 143, 128, 65, 63, 59, 19, 38, 20, 16, 1, 69, 136, 150, 79, 140, 145, 149, 118, 144, 153, 150, 141, 141, 151, 125, 142, 15, 26, 27, 48, 56, 58, 59, 55, 50, 43, 55, 40, 59, 53, 38, 1, 8, 12, 10, 24, 18, 5, 35, 33, 38, 30, 45, 43, 46, 34, 14, 21, 30, 23, 11, 3, 22, 154, 153, 153, 153, 155, 154, 153, 155, 152, 109, 130, 125, 135, 12, 50, 14, 148, 151, 154, 152, 151, 141, 147, 147,
+#> 147, 120, 114, 146, 149, 107, 75, 2, 39, 2, 1, 3, 52, 49, 94, 96, 128, 131, 71, 17, 94, 147, 61, 75, 16, 91, 94, 85, 50, 55, 22, 44, 14, 2, 3, 13, 31, 37, 42, 39, 43, 33, 37, 34, 29, 33, 32, 31, 19, 38, 35, 26, 2, 2, 21, 45, 42, 41, 44, 26, 21, 39, 16, 8, 1, 2, 36, 37, 35, 31, 24, 34, 38, 31, 35, 30, 27, 28, 6, 19, 20, 12, 103, 102, 130, 135, 126, 153, 148, 113, 140, 112, 134, 137, 153, 143, 126, 35, 82, 35, 42, 10, 1, 43, 119, 121, 135, 124, 121, 66, 81, 17, 64, 85, 20, 110, 26, 108, 140, 145, 152,
+#> 143, 138, 143, 127, 112, 102, 103, 28, 16, 45, 2, 51, 44, 38, 42, 36, 24, 29, 32, 17, 14, 28, 5, 11, 11, 24, 32, 38, 32, 32, 35, 40, 47, 40, 34, 28, 27, 25, 25, 22, 23, 30, 3, 96, 151, 112, 111, 127, 150, 149, 116, 145, 52, 53, 137, 128, 126, 17, 7, 142, 153, 142, 150, 152, 149, 144, 130, 130, 155, 135, 154, 119, 57, 5, 31, 85, 111, 117, 93, 127, 120, 25, 141, 116, 121, 140, 130, 116, 121, 110, 88, 97, 37, 64, 19, 109, 117, 145, 139, 146, 146, 64, 134, 152, 149, 140, 99, 100, 90, 42, 58, 18, 10,
+#> 6, 3, 79, 82, 113, 116, 136, 149, 127, 117, 131, 108, 69, 66, 33, 14, 51, 36, 22, 134, 120, 126, 131, 135, 130, 122, 139, 130, 129, 115, 44, 27, 152, 153, 147, 106, 119, 143, 138, 128, 154, 146, 138, 128, 143, 103, 125, 93, 9, 37, 9, 40, 4, 14, 101, 150, 154, 150, 147, 148, 135, 145, 101, 47, 151, 150, 132, 151, 147, 147, 79, 38, 9, 41, 43, 41, 41, 49, 40, 57, 42, 49, 51, 50, 29, 26, 23, 24, 21, 22, 22, 20, 5, 1, 1, 11, 117, 153, 157, 85, 133, 139, 156, 154, 110, 70, 142, 45, 62, 144, 117, 82, 153,
+#> 153, 119, 143, 108, 24, 135, 77, 127, 71, 9, 37, 134, 137, 153, 154, 152, 149, 146, 131, 108, 91, 145, 142, 107, 140, 65, 21, 91, 89, 90, 72, 24, 33, 39, 109, 105, 66, 32, 24, 57, 8, 21, 33, 42, 36, 43, 47, 33, 23, 32, 8, 18, 2, 4, 4, 137, 105, 135, 119, 130, 126, 44, 22, 84, 147, 146, 129, 127, 151, 140, 82, 4, 9, 29, 149, 147, 152, 143, 148, 155, 147, 112, 18, 114, 148, 133, 121, 6, 109, 120, 99, 136, 151, 154, 142, 49, 88, 146, 149, 153, 137, 119, 82, 132, 17, 15, 10, 10, 100, 132, 153, 118, 153,
+#> 148, 13, 133, 12, 45, 45, 51, 39, 42, 50, 41, 44, 45, 22, 35, 35, 32, 24, 25, 23, 21, 42, 40, 37, 35, 34, 34, 39, 30, 11, 7, 3, 107, 62, 142, 146, 145, 150, 155, 112, 135, 117, 67, 7, 34, 3, 22, 39, 31, 39, 4, 39, 38, 38, 27, 12, 20, 31, 8, 4, 28, 38, 42, 40, 36, 9, 10, 13, 10, 126, 155, 155, 154, 154, 154, 155, 156, 152, 154, 149, 155, 157, 157, 8, 155, 153, 116, 147, 143, 135, 142, 139, 123, 130, 150, 126, 54, 14, 13, 1, 13, 22, 43, 37, 37, 46, 46, 40, 36, 42, 30, 26, 8, 16, 16, 8, 18, 36, 48,
+#> 39, 22, 27, 11, 6, 44, 40, 36, 37, 34, 43, 12, 18, 35, 33, 4, 1, 36, 9, 17, 27, 42, 48, 40, 43, 37, 39, 39, 35, 34, 38, 33, 43, 44, 35, 36, 19, 1, 48, 39, 30, 37, 35, 29, 33, 38, 33, 28, 29, 19, 20, 33, 37, 30, 25, 16, 144, 155, 152, 151, 145, 150, 154, 154, 146, 139, 148, 154, 148, 125, 89, 11, 95, 114, 82, 83, 9, 1, 3, 77, 133, 98, 150, 149, 150, 154, 153, 154, 123, 153, 145, 79, 85, 95, 108, 90, 128, 21, 120, 120, 107, 115, 92, 113, 91, 93, 85, 39, 3, 4, 16, 150, 152, 151, 68, 154, 134, 121, 140,
+#> 122, 106, 129, 147, 112, 72, 19, 55, 3, 101, 15, 19, 23, 19, 21, 15, 41, 40, 13, 27, 44, 51, 52, 9, 29, 33, 9, 5, 47, 33, 18, 37, 35, 30, 32, 45, 11, 31, 42, 41, 35, 8, 38, 35, 34, 16, 29, 24, 93, 78, 103, 138, 134, 120, 122, 83, 144, 140, 15, 89, 35, 40, 49, 39, 48, 45, 49, 33, 36, 39, 38, 33, 21, 13, 27, 1, 3, 52, 104, 140, 138, 153, 130, 148, 78, 144, 138, 97, 90, 26, 82, 81, 65, 20, 126, 112, 75, 148, 40, 121, 26, 18, 23, 5, 8, 123, 133, 154, 155, 154, 101, 152, 155, 154, 150, 154, 144, 152,
+#> 118, 139, 127, 45, 59, 17, 142, 155, 145, 124, 110, 122, 124, 121, 85, 119, 125, 101, 153, 151, 127, 117, 127, 30, 26, 2, 24, 150, 145, 152, 149, 142, 137, 138, 144, 122, 63, 89, 26, 44, 49, 43, 36, 21, 33, 25, 3, 19, 20, 34, 32, 38, 37, 35, 43, 27, 43, 52, 38, 1, 2, 47, 53, 48, 55, 61, 34, 75, 61, 18, 53, 5, 26, 3, 2, 4, 7, 150, 147, 154, 150, 135, 14, 129, 8, 56, 84, 109, 150, 51, 13, 33, 1, 42, 40, 45, 36, 37, 31, 34, 29, 35, 28, 3, 33, 6, 66, 80, 39, 76, 80, 97, 76, 75, 68, 47, 69, 59, 33, 20,
+#> 39, 37, 36, 40, 45, 49, 42, 42, 39, 24, 29, 31, 26, 24, 12, 19, 13, 8, 36, 114, 154, 140, 134, 148, 43, 78, 83, 10, 26, 61, 118, 149, 153, 139, 154, 149, 150, 147, 155, 150, 149, 124, 144, 135, 30, 70, 15, 89, 151, 139, 155, 153, 151, 154, 140, 152, 156, 134, 24, 87, 64, 8, 38, 12, 63, 145, 154, 156, 143, 152, 127, 144, 81, 148, 143, 143, 149, 143, 45, 59, 76, 3, 6, 19, 20, 35, 37, 28, 37, 32, 40, 23, 9, 21, 21, 99, 107, 51, 141, 149, 151, 154, 132, 144, 106, 19, 98, 26, 2, 26, 6, 53, 40, 47, 38,
+#> 40, 38, 45, 41, 41, 30, 44, 24, 32, 39, 29, 41, 34, 35, 47, 48, 31, 43, 33, 24, 35, 39, 33, 3, 47, 45, 51, 43, 41, 38, 37, 29, 29, 32, 42, 35, 10, 37, 42, 40, 37, 41, 35, 35, 36, 38, 18, 28, 13, 6, 27, 27, 20, 13, 1, 9, 64, 149, 156, 148, 154, 152, 115, 119, 29, 117, 115, 129, 25, 85, 116, 50, 14, 12, 4, 15, 40, 37, 35, 38, 34, 31, 34, 32, 26, 9, 23, 13, 1, 1, 20, 35, 39, 52, 44, 40, 36, 31, 34, 33, 37, 15, 12, 21, 9, 25, 154, 153, 113, 154, 153, 138, 152, 156, 135, 133, 11, 155, 153, 47, 75, 15,
+#> 12, 27, 40, 42, 44, 34, 40, 11, 16, 17, 5, 34, 33, 2, 1, 47, 51, 51, 53, 51, 27, 13, 19, 10, 1, 1, 1, 72, 143, 129, 135, 154, 152, 146, 137, 145, 128, 127, 105, 139, 5, 104, 90, 99, 5, 10, 130, 109, 130, 108, 130, 104, 120, 112, 140, 132, 128, 106, 109, 82, 85, 54, 14, 152, 144, 133, 146, 153, 139, 132, 131, 147, 143, 138, 148, 64, 18, 38, 125, 142, 120, 132, 146, 133, 122, 138, 152, 122, 44, 92, 115, 57, 26, 49, 8, 37, 36, 36, 41, 31, 38, 34, 34, 33, 40, 35, 34, 28, 33, 26, 24, 8, 35, 34, 33, 36,
+#> 36, 39, 34, 25, 29, 29, 25, 23, 25, 4, 9, 151, 156, 145, 137, 150, 150, 138, 30, 59, 99, 16, 97, 2, 20, 3, 128, 111, 126, 126, 140, 128, 128, 105, 71, 131, 36, 59, 114, 103, 118, 115, 91, 56, 61, 26, 148, 149, 154, 155, 156, 146, 150, 106, 37, 133, 142, 48, 78, 128, 66, 26, 41, 75, 20, 5, 22, 7, 27, 34, 40, 37, 49, 29, 41, 35, 13, 1, 129, 152, 149, 137, 156, 126, 148, 152, 156, 106, 128, 149, 64, 65, 4, 108, 3, 152, 124, 145, 128, 134, 147, 143, 109, 98, 21, 51, 45, 45, 10, 4, 31, 27, 32, 14, 2,
+#> 82, 30, 43, 31, 23, 23, 11, 36, 40, 39, 44, 44, 42, 36, 38, 39, 29, 31, 15, 29, 19, 30, 11, 13, 15, 80, 146, 132, 155, 121, 46, 6, 45, 89, 87, 35, 82, 124, 150, 148, 138, 154, 152, 153, 152, 150, 151, 150, 125, 151, 148, 152, 125, 120, 135, 31, 4, 3, 4, 86, 132, 139, 155, 152, 142, 125, 138, 138, 121, 8, 30, 39, 44, 38, 46, 45, 36, 30, 35, 38, 37, 24, 1, 117, 153, 152, 12, 154, 155, 138, 148, 19, 78, 142, 125, 2, 30, 65, 92, 152, 153, 149, 154, 133, 148, 137, 150, 154, 151, 140, 143, 141, 68, 73,
+#> 4, 9, 149, 153, 119, 104, 152, 138, 144, 146, 145, 116, 25, 14, 128, 128, 131, 73, 148, 155, 141, 93, 73, 77, 127, 121, 66, 39, 6, 123, 85, 145, 110, 135, 143, 98, 91, 88, 86, 40, 105, 138, 154, 134, 154, 107, 141, 58, 20, 138, 151, 145, 120, 132, 139, 154, 132, 141, 153, 76, 139, 116, 3, 31, 36, 32, 37, 4, 34, 35, 6, 18, 33, 38, 15, 14, 24, 13, 33, 25, 13, 23, 37, 24, 30, 34, 32, 11, 20, 27, 17, 15, 24, 85, 146, 154, 142, 115, 142, 116, 146, 150, 136, 140, 48, 56, 90, 78, 110, 88, 70, 6, 96, 139,
+#> 151, 118, 153, 138, 154, 81, 148, 150, 154, 142, 155, 18, 149, 139, 139, 142, 50, 72, 20, 111, 124, 149, 154, 152, 156, 149, 151, 140, 144, 98, 150, 92, 76, 151, 87, 154, 154, 151, 153, 156, 151, 145, 60, 63, 10, 30, 42, 39, 47, 47, 49, 42, 43, 42, 43, 36, 40, 6, 26, 38, 3, 37, 35, 32, 36, 35, 12, 17, 25, 22, 28, 7, 37, 32, 29, 33, 35, 5, 10, 7, 17, 4, 7, 41, 37, 27, 2, 37, 30, 151, 154, 149, 130, 154, 100, 31, 146, 126, 10, 114, 138, 102, 34, 36, 33, 27, 2, 7, 5, 126, 145, 149, 153, 155, 126, 142,
+#> 101, 154, 152, 106, 13, 90, 113, 78, 81, 23, 134, 107, 154, 154, 129, 150, 121, 48, 16, 64, 39, 16, 39, 35, 25, 25, 23, 3, 5, 18, 35, 30, 1, 89, 149, 135, 154, 151, 152, 139, 136, 69, 8, 37, 37, 29, 60, 60, 6, 52, 48, 55, 55, 45, 50, 53, 54, 45, 44, 33, 38, 30, 21, 8, 14, 50, 88, 104, 66, 10, 60, 49, 32, 123, 144, 116, 100, 66, 107, 119, 98, 36, 31, 62, 81, 49, 2, 12, 20, 126, 121, 100, 151, 147, 118, 60, 102, 86, 48, 141, 115, 36, 3, 2, 1, 50, 7, 28, 44, 31, 13, 46, 35, 6, 36, 43, 6, 30, 22, 10,
+#> 6, 37, 36, 10, 24, 17, 14, 11, 14, 10, 17, 21, 33, 30, 12, 35, 37, 40, 33, 31, 41, 33, 35, 1, 12, 24, 151, 156, 155, 154, 145, 126, 153, 152, 135, 81, 15, 75, 73, 118, 107, 132, 120, 121, 120, 129, 130, 109, 117, 105, 104, 117, 115, 88, 48, 3, 53, 65, 32, 93, 120, 135, 140, 130, 119, 40, 39, 43, 42, 44, 37, 37, 28, 32, 13, 13, 31, 16, 13, 25, 14, 148, 136, 147, 145, 124, 136, 42, 87, 80, 62, 127, 151, 155, 156, 147, 152, 112, 155, 144, 148, 119, 142, 141, 147, 153, 138, 152, 150, 138, 149, 149, 117,
+#> 144, 143, 14, 26, 39, 39, 43, 44, 9, 48, 42, 44, 36, 35, 33, 30, 25, 19, 25, 19, 10, 44, 43, 16, 33, 34, 35, 34, 6, 31, 32, 31, 26, 32, 34, 33, 35, 41, 45, 45, 149, 144, 143, 150, 150, 156, 137, 155, 89, 148, 6, 37, 117, 98, 136, 132, 129, 103, 113, 9, 22, 52, 23, 83, 49, 64, 56, 36, 15, 40, 37, 39, 40, 37, 37, 24, 24, 20, 7, 1, 51, 46, 24, 11, 28, 40, 63, 22, 14, 31, 32, 31, 31, 24, 1, 34, 125, 131, 148, 78, 124, 125, 150, 146, 141, 144, 111, 24, 24, 29, 1, 87, 78, 60, 149, 137, 153, 118, 132, 88,
+#> 41, 6, 63, 154, 101, 51, 98, 112, 117, 53, 58, 147, 137, 152, 155, 149, 151, 150, 154, 143, 105, 8, 12, 119, 3, 92, 144, 60, 99, 124, 136, 126, 21, 56, 88, 155, 119, 32, 53, 51, 5, 111, 138, 140, 152, 141, 44, 150, 45, 83, 60, 50, 54, 2, 11, 58, 135, 147, 152, 154, 156, 151, 105, 148, 143, 98, 41, 85, 55, 38, 5, 36, 77, 151, 154, 142, 154, 155, 115, 91, 151, 130, 85, 64, 19, 149, 120, 126, 139, 137, 116, 124, 75, 3, 24, 32, 43, 30, 34, 33, 28, 35, 11, 19, 15, 29, 7, 21, 11, 36, 24, 27, 18, 109, 138,
+#> 138, 135, 146, 130, 136, 152, 15, 137, 74, 16, 32, 102, 156, 151, 131, 146, 157, 142, 149, 150, 95, 63, 138, 108, 147, 107, 132, 145, 34, 79, 4, 22, 4, 43, 26, 10, 23, 30, 3, 29, 16, 37, 40, 31, 27, 11, 10, 9, 33, 27, 21, 14, 1, 16, 1, 15, 33, 29, 36, 4, 12, 16, 29, 16, 7, 15, 3, 146, 93, 58, 137, 125, 122, 110, 64, 84, 53, 74, 34, 1, 2, 9, 34, 41, 48, 38, 35, 42, 4, 46, 56, 37, 7, 18, 112, 149, 140, 113, 152, 156, 147, 146, 151, 148, 123, 140, 143, 69, 108, 10, 91, 24, 96, 77, 11, 74, 88, 115, 143,
+#> 100, 146, 118, 129, 137, 138, 63, 134, 127, 136, 85, 61, 82, 14, 156, 137, 115, 147, 124, 118, 132, 1, 149, 154, 149, 149, 152, 110, 149, 116, 151, 153, 80, 13, 12, 38, 35, 28, 39, 29, 15, 29, 12, 23, 28, 28, 26, 23, 18, 33, 22, 18, 45, 21, 44, 35, 39, 41, 14, 25, 21, 37, 2, 30, 38, 3, 36, 35, 33, 7, 1, 12, 23, 11, 27, 28, 24, 30, 1, 4, 34, 17, 51, 86, 149, 149, 153, 152, 147, 114, 7, 104, 3, 145, 137, 145, 149, 115, 150, 155, 155, 149, 109, 92, 44, 46, 101, 3, 22, 4, 47, 38, 29, 37, 37, 34, 20,
+#> 4, 28, 10, 8, 1, 37, 42, 29, 32, 12, 1, 43, 19, 9, 3, 1, 125, 155, 147, 129, 144, 123, 146, 149, 144, 134, 106, 67, 3, 80, 122, 131, 117, 128, 133, 106, 130, 24, 62, 86, 58, 32, 147, 153, 155, 143, 148, 127, 131, 25, 69, 103, 20, 49, 3, 104, 135, 102, 155, 155, 153, 155, 151, 155, 154, 48, 102, 31, 155, 85, 132, 127, 113, 108, 15, 124, 94, 11, 35, 33, 40, 36, 45, 51, 42, 40, 34, 32, 33, 34, 42, 26, 10, 2, 30, 40, 43, 33, 37, 5, 31, 30, 30, 30, 28, 22, 7, 155, 78, 111, 112, 110, 59, 3, 3, 12, 140,
+#> 157, 146, 156, 149, 155, 157, 146, 152, 154, 157, 153, 154, 156, 134, 135, 115, 116, 123, 135, 124, 5, 17, 52, 47, 42, 41, 41, 44, 35, 26, 24, 21, 28, 6, 68, 125, 122, 112, 4, 87, 140, 91, 82, 42, 102, 15, 109, 102, 53, 57, 14, 54, 40, 48, 132, 150, 8, 2, 110, 151, 143, 157, 109, 127, 15, 6, 83, 154, 152, 129, 148, 141, 70, 7, 93, 50, 1, 1, 28, 33, 39, 37, 47, 40, 37, 40, 39, 38, 35, 17, 26, 7, 26, 2, 32, 148, 141, 143, 156, 143, 144, 140, 150, 151, 139, 142, 136, 98, 67, 48, 95, 144, 154, 143, 80,
+#> 5, 9, 146, 155, 138, 1, 155, 56, 55, 98, 4, 45, 2, 4, 44, 41, 36, 22, 11, 37, 30, 19, 55, 145, 127, 151, 132, 144, 155, 125, 151, 146, 140, 139, 149, 106, 2, 98, 17, 8, 26, 6, 154, 127, 61, 43, 143, 148, 118, 138, 147, 154, 150, 148, 129, 88, 22, 43, 151, 139, 154, 154, 152, 108, 14, 125, 154, 154, 134, 140, 102, 150, 152, 147, 81, 34, 88, 40, 13, 34, 38, 118, 3, 51, 42, 7, 85, 100, 95, 83, 57, 61, 45, 52, 31, 4, 1, 9, 14, 3, 44, 37, 37, 30, 38, 27, 31, 27, 30, 5, 19, 36, 28, 40, 15, 2, 32, 41, 33,
+#> 33, 21, 7, 13, 25, 75, 22, 86, 149, 21, 38, 64, 138, 154, 8, 146, 113, 142, 7, 146, 124, 106, 92, 22, 65, 107, 136, 143, 152, 132, 139, 127, 111, 105, 82, 89, 41, 27, 71, 6, 5, 115, 139, 149, 133, 142, 146, 77, 10, 13, 128, 144, 65, 129, 142, 144, 146, 84, 49, 150, 140, 138, 86, 45, 83, 95, 71, 3, 29, 31, 24, 37, 29, 33, 32, 27, 24, 25, 27, 25, 29, 35, 15, 18, 33, 41, 39, 28, 13, 3, 11, 26, 141, 152, 155, 154, 149, 150, 139, 117, 105, 27, 31, 1, 6, 2, 3, 38, 42, 9, 36, 23, 36, 34, 23, 4, 40, 41,
+#> 38, 40, 37, 41, 9, 3, 22, 138, 54, 89, 145, 3, 100, 46, 65, 8, 128, 154, 134, 51, 142, 106, 76, 5, 138, 151, 145, 148, 154, 150, 153, 28, 90, 141, 154, 152, 151, 150, 119, 102, 119, 74, 9, 1, 139, 147, 105, 26, 152, 92, 134, 157, 147, 75, 39, 134, 26, 71, 128, 102, 21, 99, 1, 50, 100, 82, 98, 110, 107, 26, 36, 1, 53, 155, 148, 147, 152, 150, 97, 140, 150, 152, 134, 81, 82, 4, 9, 27, 16, 40, 37, 38, 39, 38, 21, 6, 31, 25, 5, 20, 24, 12, 19, 142, 89, 13, 153, 144, 146, 67, 138, 152, 145, 53, 17, 9,
+#> 125, 109, 87, 95, 86, 69, 91, 103, 92, 66, 77, 31, 44, 14, 141, 139, 152, 154, 153, 144, 151, 152, 145, 146, 153, 136, 106, 26, 5, 40, 40, 40, 43, 39, 37, 26, 7, 47, 41, 45, 25, 3, 84, 152, 151, 152, 142, 151, 155, 141, 154, 149, 140, 141, 145, 147, 103, 59, 108, 144, 151, 142, 136, 155, 145, 141, 146, 128, 3, 38, 148, 154, 151, 130, 145, 125, 146, 139, 136, 144, 94, 7, 83, 125, 116, 151, 141, 142, 137, 151, 147, 140, 134, 122, 131, 120, 119, 86, 64, 4, 2, 39, 41, 44, 35, 38, 41, 37, 36, 43, 41,
+#> 42, 36, 67, 131, 99, 90, 144, 127, 150, 142, 146, 115, 73, 92, 130, 96, 64, 50, 17, 51, 50, 4, 30, 7, 2, 33, 33, 22, 30, 40, 39, 23, 5, 8, 2, 144, 152, 156, 152, 150, 151, 149, 117, 41, 147, 113, 21, 16, 24, 43, 36, 34, 43, 42, 16, 7, 17, 17, 5, 1, 4, 24, 41, 37, 40, 41, 42, 52, 38, 41, 40, 39, 39, 41, 40, 40, 39, 36, 33, 39, 21, 16, 116, 131, 155, 143, 141, 105, 136, 21, 107, 122, 47, 22, 151, 147, 156, 144, 153, 149, 136, 124, 105, 117, 136, 145, 150, 151, 117, 145, 128, 65, 56, 58, 10, 50, 53,
+#> 106, 111, 110, 99, 87, 90, 20, 128, 122, 79, 55, 42, 5, 5, 55, 47, 52, 46, 72, 56, 54, 51, 40, 49, 43, 25, 15, 2, 15, 36, 38, 33, 35, 31, 28, 30, 20, 1, 46, 63, 87, 57, 80, 89, 114, 133, 126, 113, 37, 48, 122, 84, 30, 6, 23, 42, 38, 34, 36, 39, 16, 8, 10, 3, 5, 3, 24, 29, 32, 18, 2, 15, 137, 130, 154, 156, 151, 155, 154, 115, 48, 100, 140, 114, 18, 136, 50, 55, 19, 20, 32, 56, 55, 60, 37, 7, 2, 27, 129, 91, 110, 145, 154, 36, 106, 138, 55, 55, 22, 117, 101, 15, 35, 39, 40, 37, 35, 38, 19, 14, 21,
+#> 102, 119, 155, 149, 138, 85, 37, 128, 29, 94, 74, 136, 144, 25, 94, 131, 99, 8, 74, 6, 35, 1, 28, 134, 156, 153, 158, 153, 141, 154, 150, 153, 150, 141, 124, 101, 109, 54, 11, 9, 6, 131, 135, 130, 142, 141, 134, 150, 144, 140, 131, 66, 16, 83, 130, 126, 143, 128, 144, 111, 123, 124, 103, 39, 40, 40, 31, 57, 52, 34, 39, 11, 61, 24, 24, 140, 113, 31, 11, 92, 145, 144, 152, 152, 148, 115, 127, 141, 144, 138, 49, 33, 12, 33, 34, 28, 43, 48, 63, 23, 69, 48, 43, 29, 22, 1, 133, 144, 126, 153, 128, 153,
+#> 155, 144, 152, 134, 127, 81, 31, 128, 153, 121, 11, 8, 107, 43, 80, 72, 11, 136, 99, 37, 115, 152, 107, 141, 125, 93, 28, 63, 62, 26, 79, 14, 13, 1, 23, 43, 36, 41, 36, 23, 16, 32, 35, 23, 5, 3, 20, 10, 6, 53, 74, 58, 42, 48, 9, 33, 45, 8, 27, 117, 124, 108, 142, 153, 158, 134, 132, 150, 140, 149, 119, 122, 50, 8, 40, 53, 146, 152, 150, 144, 153, 149, 148, 151, 139, 106, 126, 101, 85, 80, 129, 91, 42, 42, 37, 40, 39, 34, 36, 13, 8, 21, 14, 2, 2, 129, 154, 157, 150, 151, 154, 152, 104, 122, 133, 35,
+#> 27, 21, 3, 141, 148, 151, 2, 29, 121, 147, 142, 134, 140, 149, 153, 131, 140, 119, 89, 21, 18, 131, 152, 141, 126, 141, 120, 141, 138, 127, 119, 121, 34, 151, 152, 152, 152, 152, 151, 153, 154, 162, 157, 157, 157, 152, 141, 148, 117, 139, 136, 69, 19, 66, 14, 47, 42, 35, 27, 34, 10, 23, 28, 2, 19, 6, 7, 10, 1, 39, 33, 21, 38, 34, 30, 36, 34, 27, 25, 15, 33, 37, 36, 34, 21, 7, 26, 51, 33, 33, 40, 43, 44, 7, 28, 55, 20, 14, 16, 9, 7, 31, 145, 96, 42, 145, 141, 151, 108, 142, 79, 75, 127, 88, 13, 6,
+#> 37, 40, 25, 14, 25, 3, 37, 57, 34, 5, 6, 32, 34, 7, 96, 142, 127, 146, 147, 150, 144, 150, 144, 153, 153, 123, 65, 143, 122, 108, 144, 144, 21, 43, 40, 44, 39, 44, 45, 51, 43, 39, 36, 35, 35, 26, 27, 35, 31, 20, 10, 11, 13, 21, 141, 128, 127, 68, 6, 34, 51, 109, 149, 20, 121, 73, 43, 131, 73, 103, 108, 6, 7, 5, 23, 155, 154, 148, 155, 137, 139, 121, 19, 155, 155, 145, 146, 151, 139, 139, 126, 131, 130, 120, 111, 54, 23, 3, 86, 151, 146, 147, 153, 149, 147, 145, 151, 144, 160, 148, 116, 111, 88, 137,
+#> 142, 151, 119, 151, 153, 135, 152, 146, 148, 145, 92, 40, 93, 57, 106, 5, 68, 72, 98, 6, 16, 12, 11, 2, 19, 31, 37, 32, 30, 25, 28, 2, 37, 4, 6, 30, 67, 76, 82, 94, 111, 92, 54, 37, 26, 26, 46, 26, 11, 40, 26, 3, 15, 12, 151, 152, 149, 142, 108, 145, 138, 134, 95, 122, 68, 53, 9, 113, 136, 134, 154, 135, 149, 149, 153, 138, 69, 100, 31, 60, 81, 107, 31, 80, 141, 150, 141, 143, 141, 138, 129, 113, 20, 22, 51, 4, 22, 20, 31, 39, 38, 49, 47, 47, 43, 42, 12, 9, 5, 43, 46, 63, 50, 71, 62, 13, 53, 34,
+#> 38, 32, 35, 42, 34, 34, 32, 40, 37, 2, 27, 36, 1, 21, 17, 33, 35, 5, 12, 30, 23, 8, 4, 144, 133, 24, 144, 144, 144, 120, 146, 156, 142, 145, 135, 6, 7, 3, 88, 130, 147, 152, 154, 155, 154, 154, 155, 155, 156, 150, 159, 157, 137, 133, 21, 145, 157, 138, 141, 151, 148, 149, 148, 153, 152, 152, 158, 141, 156, 134, 36, 101, 31, 30, 138, 152, 153, 149, 146, 136, 147, 153, 100, 145, 146, 125, 142, 131, 102, 131, 131, 133, 106, 91, 147, 20, 33, 34, 39, 31, 24, 30, 35, 33, 39, 38, 38, 39, 38, 22, 7, 10,
+#> 154, 154, 139, 156, 154, 155, 156, 138, 154, 130, 157, 163, 141, 151, 150, 155, 72, 39, 50, 44, 21, 45, 31, 28, 29, 23, 25, 18, 52, 46, 31, 6, 27, 1, 3, 152, 143, 145, 152, 153, 156, 153, 146, 146, 144, 151, 134, 157, 156, 146, 125, 110, 132, 152, 150, 148, 146, 139, 153, 162, 140, 156, 156, 155, 129, 130, 148, 132, 133, 103, 147, 129, 15, 49, 36, 147, 150, 142, 150, 149, 151, 153, 160, 159, 162, 144, 136, 57, 56, 10, 83, 25, 122, 153, 153, 151, 153, 154, 153, 155, 156, 161, 145, 150, 158, 155, 160,
+#> 147, 150, 139, 129, 120, 112, 137, 85, 5, 22, 39, 40, 39, 35, 42, 38, 34, 39, 41, 35, 34, 32, 39, 30, 38, 34, 2, 3, 45, 46, 39, 45, 45, 41, 47, 52, 46, 42, 39, 17, 21, 28, 8, 8, 19, 54, 19, 6, 27, 153, 155, 154, 152, 151, 156, 151, 148, 106, 82, 28, 11, 22, 109, 126, 98, 132, 113, 107, 138, 136, 101, 127, 140, 129, 116, 84, 35, 9, 138, 8, 147, 151, 153, 139, 151, 153, 149, 148, 154, 152, 39, 109, 30, 3, 2, 85, 154, 155, 154, 151, 150, 151, 145, 79, 124, 154, 137, 100, 8, 113, 157, 76, 127, 138, 132,
+#> 147, 153, 45, 135, 106, 109, 3, 33, 38, 36, 37, 39, 39, 45, 19, 9, 23, 50, 12, 10, 15, 15, 45, 36, 40, 38, 38, 43, 41, 41, 39, 43, 40, 27, 9, 25, 35, 31, 97, 98, 110, 103, 125, 107, 129, 136, 135, 150, 110, 126, 42, 66, 71, 1, 10, 35, 36, 27, 32, 33, 33, 34, 15, 24, 11, 19, 127, 147, 127, 129, 93, 52, 147, 147, 147, 144, 138, 68, 19, 18, 124, 117, 102, 146, 154, 127, 139, 148, 122, 142, 120, 148, 75, 6, 56, 151, 133, 149, 155, 151, 130, 100, 138, 121, 135, 20, 40, 29, 87, 53, 75, 5, 54, 134, 120,
+#> 144, 153, 162, 152, 150, 106, 125, 33, 46, 27, 81, 148, 152, 135, 151, 152, 159, 142, 162, 130, 162, 163, 143, 67, 112, 70, 34, 67, 79, 116, 138, 133, 112, 118, 131, 150, 142, 15, 107, 86, 69, 60, 50, 9, 48, 61, 37, 46, 5, 41, 42, 31, 29, 31, 28, 50, 49, 24, 45, 56, 7, 144, 147, 152, 152, 151, 145, 154, 148, 137, 146, 80, 25, 48, 144, 160, 154, 107, 122, 2, 148, 151, 151, 152, 162, 156, 142, 33, 19, 123, 151, 157, 154, 148, 71, 28, 3, 142, 33, 39, 6, 128, 153, 142, 157, 151, 149, 108, 135, 15, 124,
+#> 156, 126, 60, 39, 23, 15, 35, 5, 34, 35, 32, 35, 44, 49, 40, 38, 35, 38, 41, 39, 39, 35, 34, 12, 22, 5, 23, 57, 53, 58, 36, 38, 39, 55, 20, 29, 3, 3, 5, 30, 38, 43, 25, 54, 73, 35, 39, 41, 44, 37, 40, 34, 38, 40, 40, 37, 36, 17, 27, 20, 62, 128, 140, 151, 139, 108, 136, 34, 72, 98, 27, 18, 137, 145, 139, 143, 142, 137, 96, 82, 41, 16, 11, 150, 144, 159, 149, 148, 149, 135, 70, 153, 145, 81, 47, 52, 101, 106, 91, 152, 130, 160, 150, 135, 148, 149, 152, 105, 81, 130, 128, 122, 11, 71, 141, 108, 117,
+#> 48, 2, 14, 36, 33, 28, 35, 50, 39, 37, 30, 11, 7, 27, 28, 50, 44, 39, 34, 36, 38, 35, 11, 23, 21, 36, 34, 34, 26, 6, 15, 50, 145, 88, 152, 163, 162, 161, 163, 144, 157, 158, 162, 156, 158, 156, 153, 155, 153, 144, 71, 24, 5, 4, 48, 68, 26, 137, 133, 148, 147, 131, 131, 115, 48, 96, 142, 149, 148, 140, 149, 133, 106, 118, 85, 5, 25, 50, 116, 51, 99, 122, 136, 161, 157, 90, 141, 46, 119, 125, 100, 138, 26, 138, 144, 153, 159, 162, 160, 148, 159, 110, 127, 49, 95, 151, 142, 125, 151, 147, 138, 148,
+#> 161, 158, 161, 153, 155, 10, 34, 12, 2, 153, 155, 71, 144, 158, 162, 23, 157, 40, 86, 85, 59, 61, 16, 8, 9, 117, 92, 141, 123, 134, 149, 146, 149, 158, 161, 161, 153, 14, 95, 85, 87, 108, 134, 122, 126, 74, 146, 150, 140, 89, 73, 73, 146, 120, 62, 8, 35, 52, 29, 34, 39, 18, 11, 26, 15, 4, 39, 16, 28, 33, 6, 16, 26, 37, 46, 70, 57, 42, 9, 11, 4, 39, 31, 26, 62, 65, 55, 55, 57, 63, 71, 64, 41, 24, 12, 51, 62, 44, 37, 47, 38, 40, 36, 33, 38, 8, 18, 9, 9, 11, 5, 97, 73, 134, 150, 162, 161, 151, 159,
+#> 160, 149, 3, 36, 41, 40, 39, 32, 39, 42, 22, 16, 6, 5, 13, 14, 14, 35, 114, 118, 103, 128, 128, 135, 134, 136, 142, 116, 135, 115, 46, 124, 147, 111, 140, 105, 144, 146, 144, 152, 155, 152, 154, 147, 132, 138, 108, 132, 102, 27, 154, 154, 154, 155, 162, 156, 159, 156, 158, 130, 132, 148, 146, 136, 124, 115, 103, 83, 148, 148, 165, 134, 158, 158, 143, 149, 153, 104, 47, 132, 149, 71, 27, 34, 33, 16, 43, 11, 11, 1, 18, 12, 146, 159, 161, 162, 164, 162, 162, 163, 163, 161, 157, 150, 156, 117, 155, 120,
+#> 13, 58, 121, 159, 148, 147, 144, 142, 160, 152, 127, 142, 130, 135, 137, 121, 53, 5, 101, 134, 143, 154, 145, 163, 161, 160, 160, 162, 151, 60, 63, 40, 39, 46, 94, 110, 102, 108, 116, 7, 90, 90, 99, 114, 110, 100, 103, 91, 7, 68, 80, 79, 77, 3, 15, 12, 1, 18, 34, 32, 34, 39, 30, 34, 37, 9, 12, 35, 18, 56, 10, 29, 65, 27, 6, 12, 42, 20, 29, 4, 38, 42, 59, 47, 64, 60, 71, 66, 67, 51, 42, 2, 74, 87, 39, 133, 160, 149, 163, 144, 150, 135, 69, 38, 11, 3, 22, 7, 40, 9, 24, 35, 31, 43, 40, 27, 30, 15, 11,
+#> 2, 26, 37, 47, 46, 41, 40, 43, 42, 40, 58, 46, 38, 31, 12, 3, 13, 47, 48, 36, 46, 56, 47, 45, 36, 43, 56, 54, 24, 7, 31, 42, 43, 42, 36, 26, 40, 3, 4, 49, 41, 62, 24, 10, 160, 154, 134, 123, 112, 137, 144, 147, 116, 106, 111, 124, 113, 112, 22, 9, 157, 145, 153, 156, 151, 130, 152, 94, 45, 10, 8, 7, 2, 40, 44, 30, 34, 31, 33, 24, 34, 31, 31, 12, 1, 110, 132, 163, 146, 152, 17, 100, 154, 132, 24, 123, 11, 57, 66, 79, 26, 15, 137, 158, 116, 72, 8, 36, 14, 2, 48, 37, 38, 41, 36, 37, 21, 34, 32, 11,
+#> 62, 66, 79, 63, 16, 39, 20, 3, 11, 22, 43, 43, 69, 59, 57, 58, 68, 62, 63, 56, 55, 16, 54, 61, 2, 43, 44, 12, 16, 34, 40, 35, 37, 42, 28, 40, 29, 43, 41, 148, 160, 151, 151, 133, 160, 161, 157, 162, 161, 148, 125, 152, 148, 149, 155, 150, 144, 147, 105, 91, 131, 119, 29, 15, 129, 160, 159, 160, 160, 137, 160, 122, 72, 31, 66, 52, 133, 148, 126, 114, 98, 80, 85, 151, 140, 106, 108, 79, 50, 5, 3, 121, 121, 140, 132, 151, 158, 162, 156, 160, 134, 150, 153, 13, 4, 112, 142, 126, 139, 46, 135, 27, 121,
+#> 159, 119, 34, 2, 2, 3, 5, 50, 54, 42, 38, 48, 46, 37, 37, 53, 33, 157, 136, 162, 156, 148, 149, 156, 159, 160, 154, 160, 163, 162, 162, 162, 159, 163, 162, 107, 162, 151, 26, 95, 119, 72, 63, 157, 160, 143, 152, 133, 108, 135, 56, 75, 115, 66, 3, 31, 11, 30, 38, 42, 33, 39, 37, 26, 38, 38, 34, 37, 25, 34, 11, 2, 18, 49, 99, 138, 157, 157, 162, 160, 155, 149, 121, 134, 147, 103, 92, 45, 21, 40, 40, 42, 41, 40, 42, 46, 27, 35, 37, 40, 31, 34, 25, 33, 22, 5, 50, 45, 46, 36, 41, 41, 43, 20, 45, 3, 31,
+#> 90, 150, 142, 121, 139, 93, 51, 33, 63, 111, 99, 117, 38, 59, 17, 24, 75, 29, 7, 95, 154, 162, 162, 161, 164, 155, 161, 162, 160, 154, 154, 133, 149, 117, 40, 92, 135, 79, 115, 129, 118, 14, 130, 47, 41, 9, 7, 161, 149, 159, 146, 128, 153, 157, 126, 10, 146, 127, 131, 67, 10, 162, 161, 141, 122, 152, 118, 122, 155, 148, 72, 128, 119, 85, 54, 67, 118, 122, 138, 114, 157, 156, 149, 38, 31, 22, 9, 38, 44, 9, 13, 153, 124, 150, 155, 142, 158, 113, 162, 163, 100, 162, 157, 147, 139, 69, 122, 106, 11,
+#> 58, 154, 147, 161, 162, 151, 159, 161, 158, 107, 101, 45, 45, 78, 77, 58, 36, 13, 20, 143, 127, 57, 132, 110, 148, 128, 117, 152, 129, 113, 115, 12, 2, 113, 80, 142, 154, 148, 148, 135, 115, 159, 161, 161, 149, 141, 147, 114, 114, 26, 28, 34, 59, 58, 62, 50, 51, 43, 31, 1, 1, 7, 4, 100, 144, 130, 136, 155, 155, 143, 117, 148, 111, 110, 130, 120, 71, 48, 74, 153, 158, 163, 156, 160, 108, 137, 160, 160, 153, 150, 72, 34, 55, 144, 131, 155, 137, 155, 99, 21, 50, 8, 74, 157, 152, 136, 84, 95, 109, 119,
+#> 70, 73, 109, 101, 132, 137, 100, 87, 74, 4, 156, 149, 148, 120, 129, 46, 53, 11, 4, 80, 39, 28, 54, 42, 47, 48, 30, 53, 20, 39, 50, 35, 27, 43, 11, 31, 72, 8, 15, 42, 14, 37, 37, 36, 36, 39, 38, 35, 37, 38, 19, 6, 83, 13, 17, 140, 159, 142, 108, 127, 138, 159, 158, 96, 131, 12, 11, 49, 50, 3, 148, 15, 10, 108, 117, 144, 140, 134, 128, 145, 136, 141, 138, 148, 140, 124, 117, 63, 122, 126, 67, 38, 74, 17, 3, 15, 57, 33, 59, 82, 44, 23, 46, 54, 52, 67, 57, 43, 6, 26, 6, 40, 5, 26, 2, 43, 53, 84, 38,
+#> 20, 70, 78, 56, 11, 36, 11, 63, 45, 162, 142, 161, 159, 152, 27, 104, 130, 72, 44, 5, 13, 13, 10, 160, 158, 132, 149, 153, 113, 114, 83, 26, 17, 81, 153, 147, 152, 133, 82, 121, 114, 119, 76, 2, 21, 138, 137, 127, 126, 150, 150, 139, 146, 137, 64, 62, 21, 15, 4, 124, 140, 134, 144, 140, 125, 154, 152, 154, 128, 140, 114, 110, 134, 95, 50, 5, 122, 141, 96, 124, 104, 94, 49, 82, 42, 9, 15, 35, 38, 54, 47, 18, 27, 52, 40, 37, 18, 15, 75, 95, 106, 132, 154, 157, 121, 143, 154, 140, 160, 123, 154, 131,
+#> 2, 120, 19, 93, 3, 10, 34, 66, 57, 54, 38, 15, 41, 41, 48, 4, 47, 17, 24, 17, 33, 35, 38, 33, 16, 65, 55, 68, 5, 71, 54, 48, 10, 5, 12, 104, 99, 156, 160, 160, 158, 158, 136, 151, 158, 137, 139, 154, 148, 132, 151, 84, 69, 91, 71, 72, 77, 4, 123, 148, 52, 103, 155, 156, 159, 159, 157, 155, 157, 153, 160, 153, 136, 133, 141, 92, 120, 32, 46, 39, 23, 29, 9, 27, 33, 38, 39, 27, 33, 25, 22, 4, 3, 24, 42, 47, 40, 40, 29, 25, 4, 45, 41, 41, 38, 32, 9, 23, 4, 162, 159, 124, 152, 127, 146, 152, 158, 158,
+#> 158, 156, 157, 120, 45, 44, 16, 8, 119, 133, 151, 141, 150, 133, 141, 142, 146, 151, 140, 145, 83, 75, 75, 2, 12, 124, 154, 156, 139, 135, 132, 161, 157, 130, 2, 6, 149, 152, 160, 151, 73, 9, 114, 124, 32, 74, 13, 2, 137, 127, 123, 51, 147, 142, 149, 153, 143, 156, 155, 152, 110, 144, 93, 138, 129, 93, 127, 36, 38, 39, 42, 39, 36, 39, 32, 37, 35, 20, 13, 36, 33, 26, 23, 22, 34, 34, 35, 16, 12, 8, 10, 22, 127, 143, 113, 150, 138, 128, 138, 44, 134, 77, 45, 130, 11, 74, 12, 47, 90, 93, 90, 79, 6, 70,
+#> 67, 157, 105, 158, 156, 149, 157, 123, 145, 139, 150, 130, 148, 36, 30, 7, 60, 1, 39, 40, 43, 40, 39, 36, 38, 41, 37, 30, 28, 34, 37, 29, 19, 34, 33, 47, 72, 38, 33, 44, 43, 40, 32, 41, 38, 42, 45, 41, 42, 41, 32, 31, 20, 27, 3, 20, 33, 38, 38, 44, 42, 14, 33, 15, 5, 6, 158, 155, 143, 147, 159, 131, 115, 143, 135, 65, 47, 148, 128, 68, 92, 41, 106, 4, 30, 92, 145, 153, 149, 142, 139, 142, 157, 99, 52, 84, 75, 53, 154, 153, 146, 155, 131, 143, 131, 120, 114, 64, 9, 26, 154, 148, 158, 149, 147, 152,
+#> 160, 142, 135, 142, 120, 130, 114, 52, 119, 110, 79, 53, 37, 68, 134, 152, 151, 132, 152, 142, 27, 105, 29, 74, 60, 8, 20, 4, 37, 40, 36, 36, 44, 42, 38, 12, 21, 35, 23, 11, 44, 55, 57, 25, 7, 8, 79, 49, 150, 63, 71, 23, 61, 26, 150, 10, 149, 17, 52, 15, 25, 143, 146, 122, 143, 141, 96, 119, 108, 111, 72, 159, 114, 1, 139, 50, 32, 33, 162, 97, 1, 29, 30, 35, 34, 24, 35, 41, 41, 30, 36, 38, 39, 12, 4, 106, 150, 145, 160, 158, 154, 155, 149, 160, 153, 154, 145, 39, 59, 131, 56, 6, 1, 25, 4, 3, 34,
+#> 51, 88, 76, 77, 44, 49, 49, 42, 43, 7, 24, 28, 7, 99, 133, 103, 129, 50, 90, 103, 75, 11, 2, 32, 25, 38, 38, 28, 39, 41, 38, 35, 38, 38, 36, 26, 2, 20, 131, 148, 145, 142, 149, 142, 118, 157, 136, 1, 78, 24, 44, 11, 8, 69, 145, 150, 145, 150, 113, 154, 155, 152, 153, 144, 135, 101, 113, 64, 54, 37, 41, 149, 162, 142, 143, 125, 153, 136, 162, 139, 91, 47, 67, 10, 47, 124, 148, 158, 152, 147, 148, 144, 154, 71, 144, 134, 30, 4, 6, 135, 144, 126, 151, 144, 140, 74, 100, 103, 130, 130, 116, 60, 102,
+#> 53, 29, 159, 96, 135, 120, 142, 129, 153, 84, 152, 108, 26, 98, 9, 35, 154, 152, 149, 150, 135, 151, 148, 157, 134, 146, 139, 131, 143, 94, 153, 116, 143, 143, 132, 115, 1, 103, 139, 142, 123, 154, 157, 158, 147, 100, 129, 115, 85, 15, 9, 30, 35, 32, 34, 37, 41, 40, 39, 37, 35, 36, 34, 36, 38, 24, 38, 37, 34, 16, 10, 16, 6, 23, 9, 4, 4, 81, 78, 63, 110, 117, 141, 139, 146, 162, 155, 149, 32, 108, 123, 11, 48, 6, 30, 139, 129, 147, 137, 134, 136, 106, 92, 124, 21, 12, 53, 70, 69, 72, 59, 55, 70, 66,
+#> 75, 67, 11, 36, 17, 9, 8, 34, 90, 67, 70, 63, 7, 33, 5, 55, 27, 9, 80, 154, 133, 162, 155, 131, 158, 38, 72, 121, 88, 61, 44, 42, 35, 35, 5, 35, 42, 36, 33, 39, 32, 47, 41, 40, 35, 35, 36, 8, 15, 19, 113, 146, 148, 82, 29, 102, 118, 132, 150, 128, 71, 106, 97, 25, 54, 33, 7, 1, 37, 120, 133, 134, 143, 69, 82, 90, 78, 11, 19, 3, 4, 12, 157, 147, 147, 153, 130, 141, 111, 119, 137, 98, 25, 47, 98, 155, 156, 135, 152, 154, 152, 129, 139, 52, 96, 111, 138, 150, 95, 141, 146, 74, 21, 26, 132, 125, 140,
+#> 147, 144, 157, 152, 149, 154, 97, 8, 43, 36, 35, 40, 38, 39, 27, 1, 25, 15, 31, 43, 36, 37, 38, 39, 40, 35, 28, 16, 18, 13, 14, 16, 31, 37, 38, 42, 35, 29, 4, 35, 26, 5, 17, 43, 110, 92, 152, 152, 149, 129, 95, 147, 110, 15, 49, 22, 12, 6, 39, 27, 38, 40, 39, 37, 38, 35, 37, 31, 18, 31, 19, 33, 28, 19, 48, 159, 147, 143, 148, 146, 132, 153, 142, 141, 151, 107, 99, 125, 98, 40, 81, 158, 157, 155, 153, 160, 150, 145, 99, 158, 26, 130, 146, 86, 45, 22, 128, 157, 156, 157, 142, 153, 143, 160, 129, 146,
+#> 158, 149, 152, 153, 98, 42, 141, 43, 19, 33, 151, 111, 123, 157, 142, 115, 106, 106, 34, 118, 107, 71, 53, 87, 111, 121, 155, 17, 110, 150, 156, 157, 162, 149, 158, 107, 157, 131, 135, 101, 97, 1, 10, 145, 151, 132, 118, 111, 61, 61, 100, 39, 64, 109, 142, 156, 147, 152, 110, 98, 23, 115, 137, 139, 144, 120, 63, 64, 11, 21, 152, 159, 146, 153, 160, 156, 147, 147, 154, 146, 58, 74, 100, 50, 65, 9, 31, 95, 106, 141, 102, 95, 80, 93, 86, 107, 50, 35, 2, 29, 36, 9, 27, 44, 38, 36, 38, 26, 39, 40, 39,
+#> 38, 23, 37, 22, 36, 14, 5, 5, 25, 127, 146, 158, 153, 147, 148, 148, 152, 146, 148, 150, 148, 124, 78, 26, 42, 30, 129, 128, 138, 136, 149, 151, 133, 114, 152, 85, 56, 47, 21, 24, 38, 7, 50, 83, 62, 15, 27, 9, 9, 30, 3, 31, 26, 8, 38, 41, 43, 38, 22, 66, 58, 54, 67, 64, 61, 40, 20, 40, 8, 10, 157, 122, 133, 10, 147, 144, 160, 149, 157, 149, 146, 141, 153, 132, 127, 141, 90, 134, 123, 116, 16, 38, 65, 82, 160, 158, 158, 128, 147, 142, 151, 133, 58, 66, 53, 13, 32, 46, 49, 36, 42, 39, 40, 41, 38, 41,
+#> 41, 37, 15, 22, 32, 34, 37, 32, 10, 24, 24, 32, 14, 16, 18, 125, 129, 113, 93, 100, 49, 5, 2, 14, 131, 135, 52, 79, 134, 152, 157, 91, 131, 96, 135, 138, 102, 153, 125, 135, 76, 103, 137, 134, 62, 25, 4, 54, 145, 132, 154, 158, 109, 77, 151, 158, 159, 156, 162, 153, 45, 28, 1, 90, 161, 139, 139, 160, 131, 150, 141, 50, 132, 137, 82, 138, 98, 110, 83, 28, 37, 145, 159, 152, 122, 162, 136, 156, 154, 156, 147, 147, 103, 142, 147, 133, 72, 14, 7, 34, 35, 34, 33, 35, 26, 35, 13, 35, 17, 33, 25, 19, 68,
+#> 35, 106, 127, 147, 120, 158, 126, 130, 64, 133, 90, 104, 49, 71, 4, 18, 19, 102, 27, 134, 77, 29, 10, 36, 6, 157, 150, 153, 141, 141, 145, 139, 6, 150, 113, 128, 96, 156, 88, 12, 25, 38, 106, 95, 111, 82, 28, 27, 49, 71, 63, 50, 59, 51, 66, 49, 64, 72, 59, 67, 10, 49, 48, 11, 34, 11, 19, 73, 42, 10, 58, 71, 65, 61, 65, 53, 57, 56, 29, 8, 51, 2, 67, 144, 142, 147, 159, 135, 147, 134, 149, 151, 134, 137, 149, 150, 98, 85, 8, 77, 55, 60, 30, 7, 133, 162, 160, 150, 144, 52, 144, 153, 150, 100, 145, 120,
+#> 116, 144, 98, 8, 76, 45, 113, 138, 131, 144, 125, 19, 66, 96, 90, 119, 86, 120, 57, 38, 31, 59, 72, 1, 150, 153, 154, 143, 127, 152, 97, 45, 75, 94, 28, 5, 1, 23, 39, 41, 47, 24, 65, 59, 36, 56, 45, 51, 43, 11, 9, 110, 94, 114, 133, 133, 33, 148, 160, 101, 150, 124, 119, 68, 20, 148, 154, 116, 156, 148, 129, 156, 155, 101, 162, 132, 147, 97, 123, 44, 45, 4, 5, 50, 46, 149, 152, 126, 156, 161, 153, 152, 137, 149, 94, 69, 17, 11, 47, 162, 162, 155, 153, 152, 162, 146, 160, 158, 159, 152, 130, 78, 32,
+#> 3, 34, 12, 35, 39, 40, 30, 40, 41, 39, 39, 13, 21, 18, 23, 5, 24, 12, 12, 89, 125, 161, 160, 156, 44, 92, 144, 159, 160, 154, 102, 141, 142, 131, 151, 151, 150, 144, 107, 1, 16, 34, 27, 35, 42, 41, 10, 98, 81, 91, 129, 162, 160, 84, 149, 153, 155, 153, 130, 82, 153, 131, 89, 76, 105, 37, 21, 4, 24, 66, 65, 92, 106, 58, 24, 30, 4, 12, 54, 90, 18, 20, 3, 34, 81, 96, 114, 156, 160, 162, 162, 162, 162, 163, 110, 162, 100, 161, 162, 155, 27, 13, 130, 133, 140, 122, 76, 136, 135, 144, 26, 133, 100, 32,
+#> 30, 37, 39, 42, 43, 38, 39, 37, 41, 39, 36, 22, 21, 19, 28, 47, 94, 120, 139, 150, 148, 149, 149, 122, 123, 103, 59, 53, 38, 29, 42, 38, 39, 26, 34, 39, 44, 29, 16, 6, 11, 101, 130, 119, 89, 160, 140, 152, 156, 153, 149, 156, 106, 147, 143, 154, 155, 90, 104, 84, 96, 48, 144, 99, 97, 112, 34, 64, 6, 59, 22, 151, 152, 152, 158, 154, 153, 116, 99, 89, 113, 121, 58, 86, 131, 145, 151, 153, 146, 100, 52, 160, 94, 160, 134, 133, 107, 40, 150, 116, 72, 85, 43, 122, 151, 137, 58, 27, 70, 13, 132, 162, 158,
+#> 160, 154, 145, 160, 150, 102, 148, 154, 151, 158, 160, 147, 108, 42, 44, 40, 31, 53, 39, 22, 25, 22, 8, 7, 17, 103, 149, 147, 155, 141, 140, 144, 135, 94, 131, 90, 45, 63, 53, 59, 17, 29, 36, 47, 17, 9, 21, 56, 56, 25, 46, 41, 1, 60, 45, 48, 65, 62, 76, 76, 70, 78, 67, 54, 66, 47, 50, 33, 47, 21, 128, 130, 142, 140, 122, 85, 69, 137, 82, 154, 130, 103, 34, 110, 111, 87, 21, 19, 41, 46, 33, 34, 38, 18, 21, 43, 35, 38, 35, 38, 32, 32, 30, 25, 9, 6, 15, 145, 132, 129, 150, 147, 110, 76, 138, 117, 142,
+#> 124, 112, 111, 87, 27, 117, 90, 21, 147, 154, 161, 155, 157, 150, 159, 151, 82, 7, 125, 144, 135, 99, 17, 146, 139, 155, 148, 143, 94, 119, 97, 77, 105, 6, 33, 23, 17, 37, 35, 25, 2, 32, 34, 6, 8, 7, 35, 38, 26, 37, 24, 22, 26, 32, 6, 31, 11, 3, 4, 3, 22, 96, 157, 158, 150, 160, 155, 157, 158, 158, 159, 145, 89, 103, 122, 129, 124, 137, 126, 112, 80, 24, 144, 153, 160, 163, 158, 124, 108, 145, 155, 159, 140, 157, 108, 135, 56, 8, 127, 116, 118, 161, 151, 155, 159, 139, 149, 160, 103, 162, 138, 88,
+#> 126, 95, 20, 46, 40, 40, 28, 38, 41, 25, 13, 28, 8, 28, 150, 161, 85, 161, 149, 149, 155, 137, 106, 104, 159, 144, 125, 4, 129, 151, 143, 140, 158, 147, 155, 121, 154, 133, 136, 163, 102, 160, 157, 28, 91, 35, 61, 54, 73, 148, 138, 159, 148, 158, 139, 67, 73, 144, 156, 160, 162, 153, 101, 144, 157, 119, 13, 36, 21, 39, 62, 31, 72, 63, 36, 64, 32, 56, 57, 62, 50, 45, 40, 46, 11, 31, 44, 30, 39, 36, 16, 1, 5, 44, 66, 65, 68, 65, 58, 58, 45, 24, 31, 9, 9, 104, 36, 59, 17, 106, 134, 144, 158, 158, 121,
+#> 144, 108, 151, 157, 146, 129, 15, 72, 29, 76, 159, 17, 142, 154, 153, 160, 159, 151, 128, 96, 134, 106, 52, 89, 27, 118, 45, 22, 132, 155, 140, 149, 149, 150, 151, 102, 139, 131, 110, 115, 140, 61, 24, 38, 76, 18, 119, 133, 128, 146, 73, 147, 152, 148, 108, 162, 126, 162, 159, 152, 154, 149, 146, 123, 101, 120, 138, 68, 148, 144, 140, 103, 152, 50, 108, 119, 79, 89, 97, 6, 25, 39, 34, 31, 25, 33, 38, 38, 29, 36, 22, 31, 31, 33, 37, 36, 20, 7, 30, 34, 32, 12, 11, 13, 33, 35, 10, 38, 43, 36, 41, 40,
+#> 39, 33, 33, 40, 35, 35, 33, 34, 33, 32, 23, 27, 7, 31, 33, 5, 29, 34, 35, 16, 28, 63, 47, 78, 69, 29, 41, 23, 30, 62, 82, 57, 50, 34, 7, 8, 58, 71, 23, 41, 8, 22, 51, 14, 30, 31, 11, 3, 4, 10, 10, 4, 77, 17, 58, 25, 38, 12, 19, 21, 7, 28, 24, 36, 40, 58, 10, 13, 133, 159, 159, 139, 128, 154, 117, 89, 144, 123, 104, 155, 124, 115, 157, 124, 142, 131, 152, 145, 17, 70, 99, 61, 106, 148, 126, 149, 162, 156, 101, 124, 101, 159, 157, 106, 112, 112, 18, 4, 39, 34, 35, 31, 33, 18, 32, 24, 30, 29, 35, 20,
+#> 13, 32, 34, 32, 33, 34, 33, 32, 3, 29, 17, 79, 58, 30, 118, 155, 137, 138, 141, 74, 58, 147, 99, 19, 96, 102, 8, 18, 158, 147, 146, 143, 21, 135, 103, 60, 136, 159, 109, 38, 14, 128, 26, 29, 18, 36, 16, 145, 146, 97, 121, 132, 132, 119, 141, 76, 143, 142, 139, 150, 144, 128, 122, 131, 40, 25, 88, 132, 148, 154, 158, 95, 146, 101, 127, 118, 120, 127, 80, 59, 122, 69, 25, 106, 46, 21, 30, 51, 99, 111, 152, 152, 143, 127, 154, 94, 145, 146, 129, 149, 151, 154, 150, 135, 82, 16, 33, 106, 78, 145, 123,
+#> 127, 62, 70, 58, 112, 92, 110, 132, 113, 57, 39, 27, 110, 120, 152, 162, 132, 136, 34, 108, 85, 146, 110, 139, 122, 28, 6, 3, 13, 29, 127, 159, 149, 142, 112, 153, 149, 151, 153, 103, 147, 149, 100, 111, 83, 160, 161, 159, 158, 99, 151, 156, 162, 156, 137, 160, 161, 160, 155, 153, 156, 154, 108, 113, 64, 88, 46, 9, 24, 139, 157, 155, 151, 103, 148, 159, 138, 139, 130, 153, 157, 118, 147, 149, 143, 121, 75, 79, 42, 30, 125, 147, 134, 153, 138, 93, 144, 104, 142, 143, 141, 120, 110, 145, 26, 93, 124,
+#> 90, 7, 145, 126, 36, 143, 143, 80, 155, 141, 142, 26, 17, 27, 9, 2, 21, 25, 27, 30, 39, 41, 42, 28, 39, 37, 31, 34, 35, 21, 35, 29, 30, 35, 30, 34, 33, 32, 30, 27, 27, 13, 114, 158, 152, 154, 145, 153, 155, 109, 11, 33, 7, 93, 62, 2, 5, 82, 133, 152, 161, 152, 157, 150, 150, 152, 123, 145, 100, 137, 153, 132, 143, 76, 73, 78, 21, 36, 41, 38, 38, 41, 35, 38, 44, 16, 12, 4, 20, 31, 43, 25, 9, 36, 32, 15, 4, 53, 153, 155, 154, 118, 80, 141, 126, 148, 148, 147, 148, 110, 142, 144, 80, 32, 40, 154, 157,
+#> 158, 158, 123, 141, 141, 73, 59, 46, 131, 11, 11, 7, 36, 37, 34, 37, 23, 34, 32, 30, 34, 30, 22, 13, 15, 89, 143, 114, 77, 105, 86, 132, 120, 129, 97, 135, 104, 95, 41, 14, 64, 129, 161, 159, 161, 159, 103, 160, 95, 55, 154, 158, 149, 154, 95, 75, 43, 11, 142, 145, 155, 117, 134, 151, 153, 141, 58, 128, 147, 16, 72, 99, 59, 37, 47, 12, 94, 127, 151, 146, 86, 22, 48, 111, 86, 11, 10, 42, 28, 46, 37, 40, 34, 42, 38, 42, 41, 39, 38, 44, 45, 44, 40, 22, 35, 34, 32, 33, 34, 1, 22, 3, 11, 139, 127, 145,
+#> 109, 152, 161, 143, 152, 144, 149, 115, 148, 132, 138, 130, 119, 92, 84, 89, 121, 124, 79, 140, 104, 32, 130, 141, 60, 150, 89, 131, 153, 149, 161, 158, 160, 162, 66, 152, 151, 155, 161, 158, 162, 68, 38, 109, 70, 112, 104, 78, 54, 107, 147, 161, 154, 127, 149, 143, 96, 156, 149, 160, 122, 140, 158, 162, 160, 158, 130, 150, 127, 8, 26, 136, 156, 143, 127, 99, 157, 135, 57, 126, 65, 131, 150, 142, 115, 140, 81, 2, 20, 36, 40, 39, 40, 20, 36, 20, 34, 15, 29, 16, 7, 34, 30, 5, 64, 42, 52, 62, 64, 62,
+#> 60, 48, 70, 60, 71, 58, 16, 38, 14, 12, 30, 121, 106, 123, 160, 107, 150, 153, 106, 155, 160, 148, 154, 134, 63, 132, 156, 116, 153, 159, 129, 142, 162, 129, 97, 148, 156, 148, 67, 84, 155, 143, 21, 74, 34, 15, 134, 145, 109, 132, 138, 112, 72, 138, 18, 97, 109, 72, 17, 21, 154, 158, 152, 152, 118, 141, 94, 149, 88, 31, 98, 125, 81, 108, 76, 17, 56, 145, 143, 137, 157, 158, 159, 162, 105, 140, 152, 141, 155, 154, 156, 149, 112, 20, 150, 156, 143, 77, 46, 8, 1, 102, 118, 137, 145, 157, 154, 158, 162,
+#> 90, 103, 157, 144, 134, 142, 160, 108, 20, 92, 17, 107, 120, 27, 69, 131, 145, 143, 69, 161, 141, 155, 124, 120, 36, 4, 13, 50, 60, 58, 71, 38, 23, 13, 50, 1, 6, 8, 5, 16, 148, 150, 101, 117, 142, 8, 12, 14, 5, 153, 155, 101, 162, 162, 140, 162, 162, 144, 95, 136, 141, 109, 63, 46, 1, 2, 40, 44, 14, 34, 36, 20, 15, 20, 29, 35, 33, 37, 5, 20, 36, 29, 16, 22, 18, 117, 131, 130, 119, 130, 150, 157, 118, 61, 120, 145, 127, 84, 68, 85, 69, 115, 142, 162, 148, 155, 154, 152, 149, 159, 156, 103, 156, 151,
+#> 111, 78, 103, 41, 150, 158, 162, 133, 56, 4, 142, 130, 47, 67, 129, 143, 110, 41, 135, 112, 121, 134, 123, 10, 8, 58, 56, 119, 145, 81, 100, 149, 100, 147, 158, 144, 6, 48, 150, 155, 162, 162, 103, 158, 97, 48, 117, 24, 34, 118, 36, 34, 4, 38, 39, 32, 18, 20, 27, 40, 36, 44, 36, 38, 37, 24, 35, 38, 38, 32, 3, 25, 19, 8, 5, 38, 15, 4, 43, 57, 51, 54, 60, 41, 56, 58, 45, 55, 65, 57, 34, 34, 34, 25, 24, 27, 39, 42, 34, 17, 31, 30, 32, 49, 15, 60, 121, 159, 107, 151, 130, 153, 152, 98, 82, 49, 98, 12,
+#> 13, 127, 154, 161, 102, 136, 137, 128, 141, 156, 146, 147, 112, 115, 113, 132, 105, 17, 4, 24, 17, 15, 29, 33, 23, 29, 16, 14, 19, 139, 142, 146, 105, 157, 142, 139, 149, 151, 151, 128, 121, 146, 101, 29, 112, 76, 74, 66, 90, 93, 36, 90, 156, 157, 128, 105, 58, 88, 143, 124, 32, 9, 9, 144, 91, 154, 157, 140, 154, 100, 154, 145, 159, 149, 132, 139, 130, 50, 92, 101, 95, 159, 156, 158, 110, 140, 159, 124, 158, 153, 158, 153, 155, 143, 150, 132, 141, 98, 44, 82, 32, 75, 40, 72, 69, 72, 84, 62, 47, 20,
+#> 33, 63, 5, 131, 48, 22, 59, 41, 66, 46, 19, 13, 24, 37, 20, 51, 40, 56, 25, 12, 85, 143, 144, 96, 133, 155, 147, 140, 91, 130, 123, 124, 133, 119, 24, 69, 10, 40, 70, 14, 94, 58, 92, 100, 115, 132, 128, 139, 156, 107, 159, 125, 131, 101, 103, 42, 58, 113, 139, 145, 149, 152, 36, 102, 140, 150, 101, 136, 144, 120, 16, 69, 102, 65, 69, 20, 35, 35, 35, 34, 33, 32, 20, 36, 37, 16, 34, 34, 34, 6, 31, 37, 7, 7, 31, 88, 136, 147, 71, 89, 80, 38, 96, 68, 113, 84, 102, 49, 90, 33, 6, 6, 27, 41, 24, 12, 34,
+#> 37, 34, 34, 35, 14, 29, 8, 14, 43, 57, 78, 51, 46, 48, 54, 56, 48, 11, 38, 2, 11, 152, 159, 158, 145, 153, 159, 150, 157, 85, 150, 159, 146, 145, 97, 45, 10, 25, 38, 36, 35, 35, 39, 38, 23, 34, 35, 2, 32, 8, 29, 36, 14, 5, 20, 3, 46, 122, 131, 92, 116, 143, 104, 2, 89, 158, 108, 149, 145, 142, 143, 153, 95, 140, 65, 85, 136, 134, 117, 90, 44, 87, 112, 148, 32, 88, 152, 121, 31, 92, 123, 72, 30, 3, 33, 42, 48, 3, 31, 33, 32, 32, 30, 34, 23, 21, 33, 54, 29, 3, 15, 33, 31, 64, 74, 74, 60, 60, 55, 53,
+#> 61, 54, 51, 7, 13, 10, 121, 157, 151, 102, 128, 80, 151, 98, 151, 151, 150, 148, 134, 5, 135, 4, 118, 91, 80, 158, 109, 138, 145, 157, 103, 121, 28, 120, 60, 7, 28, 28, 44, 25, 37, 44, 35, 36, 35, 36, 34, 24, 36, 35, 34, 27, 23, 5, 25, 75, 98, 150, 160, 144, 137, 31, 152, 59, 44, 162, 136, 115, 43, 35, 54, 94, 135, 117, 125, 94, 105, 96, 42, 82, 113, 74, 53, 50, 4, 33, 53, 45, 34, 32, 24, 30, 3, 22, 6, 19, 18, 151, 104, 156, 104, 162, 162, 162, 162, 160, 159, 156, 154, 97, 57, 153, 18, 26, 23, 160,
+#> 162, 162, 161, 162, 162, 161, 162, 161, 162, 162, 162, 112, 144, 163, 162, 161, 86, 83, 128, 31, 150, 155, 145, 136, 157, 157, 160, 158, 155, 158, 143, 57, 7, 18, 11, 140, 64, 147, 131, 152, 146, 122, 21, 80, 10, 1, 61, 129, 150, 142, 120, 145, 100, 153, 95, 146, 120, 140, 133, 4, 96, 87, 148, 100, 137, 153, 141, 131, 24, 21, 29, 35, 29, 30, 17, 43, 10, 53, 44, 50, 44, 25, 52, 40, 31, 35, 3, 10, 6, 21, 16, 2, 3, 34, 35, 26, 38, 25, 34, 29, 28, 7, 60, 17, 121, 99, 137, 156, 162, 103, 158, 106, 46,
+#> 35, 135, 44, 57, 20, 36, 29, 38, 36, 35, 36, 38, 34, 33, 33, 33, 9, 21, 4, 19, 17, 17, 100, 62, 156, 130, 145, 120, 28, 134, 48, 43, 134, 135, 122, 84, 9, 94, 35, 17, 38, 35, 35, 40, 30, 40, 38, 23, 35, 36, 31, 8, 1, 2, 7, 28, 35, 34, 33, 34, 21, 15, 34, 34, 30, 29, 10, 5, 5, 6, 25, 6, 43, 71, 59, 21, 91, 136, 124, 119, 92, 125, 128, 109, 132, 122, 60, 77, 79, 62, 61, 8, 2, 25, 43, 39, 36, 35, 31, 35, 2, 26, 30, 26, 33, 31, 16, 19, 21, 4, 36, 22, 33, 27, 13, 156, 158, 156, 153, 154, 132, 155, 157,
+#> 155, 158, 158, 117, 57, 150, 135, 8, 66, 138, 151, 147, 147, 144, 116, 149, 141, 143, 141, 133, 126, 40, 91, 67, 31, 9, 123, 147, 145, 152, 124, 153, 137, 58, 29, 125, 131, 138, 130, 45, 67, 123, 122, 120, 132, 14, 80, 83, 150, 162, 106, 158, 145, 88, 27, 90, 137, 150, 105, 2, 3, 54, 47, 58, 68, 68, 15, 3, 38, 25, 3, 20, 145, 139, 116, 86, 30, 59, 75, 51, 22, 83, 17, 122, 147, 111, 136, 154, 153, 134, 152, 139, 43, 32, 29, 32, 63, 11, 101, 24, 104, 153, 158, 161, 149, 147, 155, 156, 155, 144, 143,
+#> 143, 97, 126, 132, 104, 123, 90, 114, 100, 147, 151, 158, 152, 152, 155, 128, 135, 122, 74, 31, 162, 151, 155, 154, 155, 30, 123, 153, 134, 105, 10, 33, 84, 101, 153, 149, 148, 143, 141, 143, 85, 125, 107, 69, 6, 83, 117, 132, 107, 120, 133, 157, 153, 157, 160, 107, 155, 160, 160, 141, 141, 126, 38, 35, 80, 49, 136, 154, 5, 84, 106, 32, 95, 136, 149, 146, 95, 85, 44, 97, 117, 99, 145, 148, 120, 142, 143, 141, 105, 53, 15, 13, 30, 6, 27, 20, 35, 36, 32, 50, 9, 45, 8, 41, 13, 6, 15, 88, 156, 156, 160,
+#> 150, 151, 139, 109, 145, 130, 155, 144, 115, 101, 133, 59, 74, 109, 58, 4, 47, 98, 18, 40, 72, 66, 69, 65, 66, 63, 64, 64, 11, 53, 67, 70, 8, 55, 41, 52, 11, 43, 25, 12, 51, 83, 69, 128, 149, 154, 119, 128, 150, 71, 89, 132, 16, 116, 98, 70, 67, 55, 52, 53, 13, 75, 11, 63, 80, 74, 64, 45, 63, 32, 10, 10, 122, 122, 143, 121, 108, 93, 68, 107, 28, 26, 36, 46, 35, 9, 12, 38, 39, 36, 38, 28, 13, 23, 152, 155, 135, 157, 140, 142, 140, 145, 40, 31, 35, 33, 25, 34, 19, 35, 27, 33, 30, 7, 29, 20, 23, 26,
+#> 1, 18, 8, 54, 86, 158, 154, 160, 157, 133, 158, 141, 134, 128, 122, 110, 135, 116, 149, 127, 111, 36, 71, 4, 26, 27, 32, 30, 1, 20, 21, 36, 36, 35, 37, 41, 30, 31, 20, 7, 91, 153, 159, 162, 141, 144, 158, 102, 152, 157, 134, 97, 128, 21, 32, 36, 25, 18, 48, 43, 49, 43, 39, 32, 30, 33, 35, 39, 20, 28, 17, 19, 24, 9, 16, 6, 31, 22, 3, 10, 22, 140, 125, 154, 133, 129, 119, 136, 137, 48, 30, 5, 71, 158, 156, 160, 155, 134, 153, 159, 154, 161, 151, 150, 133, 113, 97, 57, 45, 18, 61, 25, 18, 75, 66, 68,
+#> 63, 62, 63, 63, 65, 47, 57, 14, 46, 58, 11, 150, 159, 149, 156, 155, 160, 154, 12, 134, 100, 122, 150, 142, 83, 12, 92, 63, 151, 154, 151, 153, 145, 124, 72, 71, 92, 104, 75, 40, 33, 6, 60, 39, 159, 157, 159, 156, 156, 153, 142, 149, 155, 102, 24, 98, 126, 150, 153, 156, 80, 112, 151, 148, 153, 103, 82, 75, 34, 141, 82, 161, 156, 147, 160, 145, 132, 158, 96, 50, 32, 103, 141, 140, 118, 94, 127, 143, 44, 93, 104, 107, 28, 72, 24, 32, 23, 124, 159, 143, 158, 154, 144, 72, 45, 14, 76, 103, 135, 89,
+#> 145, 159, 152, 141, 86, 15, 151, 27, 119, 70, 32, 6, 16, 18, 32, 34, 36, 37, 30, 17, 9, 23, 6, 25, 8, 33, 139, 156, 158, 137, 150, 86, 62, 12, 21, 15, 33, 36, 35, 35, 31, 35, 32, 29, 24, 23, 34, 34, 33, 30, 32, 33, 29, 33, 33, 32, 19, 18, 18, 6, 23, 37, 24, 31, 36, 38, 36, 32, 33, 32, 2, 9, 145, 157, 162, 160, 157, 154, 133, 130, 154, 152, 130, 20, 82, 90, 137, 141, 148, 37, 91, 113, 5, 25, 139, 128, 110, 155, 158, 159, 137, 129, 21, 153, 84, 30, 128, 161, 161, 157, 158, 159, 146, 152, 160, 156,
+#> 108, 137, 15, 88, 161, 163, 146, 154, 140, 161, 145, 155, 48, 94, 104, 108, 120, 138, 142, 28, 48, 56, 130, 151, 150, 142, 148, 125, 2, 88, 78, 12, 5, 32, 35, 39, 40, 32, 38, 26, 21, 10, 2, 33, 17, 74, 75, 68, 47, 67, 35, 38, 59, 72, 65, 29, 157, 159, 158, 65, 131, 154, 97, 22, 60, 111, 102, 96, 108, 151, 113, 37, 61, 76, 18, 100, 158, 151, 152, 158, 93, 49, 106, 30, 22, 82, 106, 137, 59, 80, 140, 153, 146, 79, 61, 6, 9, 62, 92, 81, 133, 144, 135, 52, 95, 93, 10, 40, 46, 41, 32, 34, 35, 31, 22, 27,
+#> 7, 8, 17, 22, 35, 35, 36, 37, 36, 35, 24, 12, 35, 35, 35, 29, 6, 3, 6, 15, 64, 70, 40, 37, 68, 65, 57, 28, 40, 68, 56, 49, 46, 29, 35, 24, 37, 35, 35, 24, 10, 33, 34, 33, 35, 18, 31, 18, 9, 23, 25, 67, 149, 159, 159, 110, 162, 121, 153, 160, 161, 77, 133, 42, 111, 50, 79, 6, 12, 110, 121, 120, 68, 96, 108, 95, 37, 1, 59, 46, 57, 56, 132, 129, 135, 131, 127, 89, 76, 23, 108, 37, 129, 42, 131, 58, 92, 74, 125, 140, 111, 64, 160, 152, 13, 140, 105, 118, 154, 155, 103, 158, 158, 160, 115, 130, 161, 135,
+#> 126, 11, 8, 134, 88, 7, 37, 80, 139, 136, 133, 89, 131, 94, 44, 150, 134, 18, 151, 155, 143, 156, 154, 139, 27, 47, 104, 130, 105, 51, 155, 153, 89, 97, 17, 146, 139, 129, 100, 152, 106, 139, 101, 81, 136, 97, 15, 109, 89, 133, 126, 108, 49, 6, 19, 7, 135, 122, 87, 44, 92, 135, 121, 76, 28, 26, 10, 18, 160, 161, 145, 160, 157, 86, 51, 143, 153, 29, 47, 103, 59, 76, 15, 69, 45, 43, 63, 36, 36, 36, 21, 33, 27, 33, 33, 34, 25, 5, 30, 34, 25, 3, 43, 43, 41, 27, 21, 32, 23, 11, 36, 26, 14, 26, 24, 16,
+#> 34, 36, 34, 35, 33, 30, 23, 33, 28, 9, 24, 26, 33, 54, 60, 51, 63, 67, 69, 64, 45, 52, 63, 57, 50, 6, 122, 104, 130, 114, 129, 128, 104, 103, 114, 145, 122, 124, 101, 8, 45, 37, 37, 40, 36, 35, 4, 21, 35, 34, 21, 26, 33, 32, 34, 32, 10, 20, 10, 67, 126, 160, 158, 153, 160, 161, 140, 145, 74, 21, 29, 159, 122, 156, 125, 156, 153, 146, 100, 101, 146, 74, 146, 134, 47, 126, 101, 137, 146, 137, 157, 154, 130, 136, 138, 154, 83, 105, 17, 63, 6, 6, 100, 105, 151, 157, 150, 152, 153, 69, 54, 109, 64, 54,
+#> 67, 74, 68, 70, 60, 55, 52, 31, 35, 47, 48, 51, 59, 61, 46, 62, 58, 38, 52, 31, 16, 147, 84, 138, 40, 103, 158, 110, 137, 155, 121, 96, 110, 80, 137, 82, 148, 153, 96, 148, 68, 20, 5, 54, 16, 149, 160, 160, 149, 128, 152, 150, 157, 146, 35, 144, 112, 112, 78, 42, 1, 25, 125, 103, 125, 108, 95, 15, 40, 17, 31, 125, 158, 145, 159, 147, 49, 146, 95, 120, 77, 24, 105, 147, 157, 152, 155, 107, 95, 120, 103, 143, 159, 154, 153, 141, 49, 72, 104, 110, 7, 75, 63, 141, 159, 163, 160, 157, 128, 139, 108, 61,
+#> 80, 159, 153, 28, 72, 60, 114, 93, 1, 2, 20, 5, 33, 39, 36, 14, 19, 31, 28, 18, 8, 33, 6, 41, 125, 151, 97, 158, 123, 140, 100, 110, 131, 152, 73, 145, 161, 102, 45, 145, 70, 111, 8, 23, 2, 106, 74, 105, 123, 124, 139, 131, 135, 127, 129, 67, 35, 1, 32, 45, 46, 8, 32, 4, 42, 29, 8, 37, 37, 36, 36, 35, 31, 26, 22, 16, 111, 150, 162, 159, 154, 148, 144, 132, 110, 123, 117, 110, 149, 77, 79, 51, 4, 15, 32, 32, 36, 35, 21, 22, 17, 19, 15, 32, 26, 19, 13, 13, 4, 39, 147, 152, 158, 151, 147, 148, 147,
+#> 143, 109, 110, 51, 25, 116, 124, 135, 111, 23, 85, 75, 2, 9, 20, 46, 77, 67, 43, 21, 62, 70, 53, 29, 14, 13, 25, 35, 20, 19, 5, 39, 42, 34, 32, 34, 35, 34, 3, 17, 12, 34, 32, 27, 22, 32, 28, 50, 34, 35, 31, 18, 7, 2, 7, 108, 62, 69, 148, 154, 140, 113, 99, 93, 95, 27, 37, 20, 51, 10, 34, 13, 37, 52, 35, 71, 27, 68, 8, 51, 51, 29, 13, 37, 55, 10, 64, 64, 72, 60, 50, 16, 3, 20, 43, 9, 34, 11, 64, 61, 13, 28, 116, 101, 123, 30, 5, 46, 102, 37, 26, 12, 3, 107, 154, 161, 153, 153, 152, 68, 83, 113, 144,
+#> 159, 152, 151, 144, 158, 49, 97, 146, 86, 27, 33, 78, 90, 82, 86, 117, 135, 154, 157, 152, 107, 134, 143, 17, 113, 158, 156, 162, 159, 161, 27, 124, 158, 110, 56, 70, 46, 96, 25, 14, 27, 20, 94, 122, 63, 43, 107, 61, 14, 54, 27, 116, 126, 88, 157, 148, 153, 154, 156, 100, 72, 93, 87, 50, 134, 150, 149, 162, 155, 114, 141, 162, 162, 160, 160, 101, 155, 145, 153, 156, 155, 145, 141, 25, 35, 31, 29, 32, 34, 31, 35, 25, 32, 35, 25, 34, 33, 34, 22, 18, 14, 74, 150, 95, 155, 138, 146, 142, 18, 7, 88, 127,
+#> 82, 114, 18, 62, 36, 42, 62, 98, 88, 72, 8, 53, 127, 141, 145, 108, 27, 139, 138, 75, 43, 136, 44, 43, 6, 23, 25, 34, 23, 38, 31, 32, 25, 35, 38, 36, 33, 35, 36, 20, 30, 26, 27, 30, 33, 40, 33, 36, 35, 34, 24, 33, 32, 32, 23, 15, 5, 87, 138, 158, 135, 150, 113, 120, 18, 1, 7, 132, 51, 89, 64, 80, 66, 127, 125, 117, 37, 97, 70, 51, 38, 75, 50, 46, 19, 27, 8, 133, 144, 97, 152, 130, 66, 146, 42, 103, 156, 119, 100, 42, 120, 122, 124, 138, 55, 11, 127, 155, 154, 142, 156, 111, 72, 140, 157, 161, 160,
+#> 145, 111, 70, 53, 83, 128, 109, 144, 41, 102, 117, 33, 113, 150, 144, 159, 151, 153, 140, 159, 112, 144, 158, 159, 156, 102, 143, 153, 143, 130, 147, 14, 130, 126, 6, 34, 37, 35, 35, 39, 35, 36, 25, 28, 35, 33, 34, 33, 35, 35, 35, 37, 34, 35, 22, 12, 35, 7, 27, 15, 27, 24, 26, 154, 149, 148, 19, 147, 91, 125, 117, 46, 37, 74, 68, 67, 63, 45, 16, 15, 1, 10, 54, 55, 65, 66, 58, 66, 74, 38, 57, 62, 61, 21, 41, 20, 51, 68, 61, 77, 67, 55, 25, 17, 7, 16, 127, 109, 144, 157, 104, 120, 40, 139, 146, 133,
+#> 68, 78, 111, 118, 30, 34, 82, 74, 159, 162, 155, 154, 109, 136, 107, 53, 98, 103, 14, 84, 52, 84, 159, 157, 146, 145, 112, 76, 105, 151, 135, 154, 96, 106, 60, 44, 54, 93, 129, 12, 114, 141, 122, 142, 130, 133, 135, 119, 117, 24, 12, 39, 21, 49, 19, 29, 31, 33, 36, 26, 14, 13, 31, 9, 42, 30, 34, 36, 35, 36, 26, 29, 39, 33, 33, 36, 37, 35, 37, 33, 35, 33, 32, 35, 14, 143, 158, 147, 161, 152, 153, 107, 130, 153, 112, 147, 159, 155, 157, 149, 67, 73, 38, 18, 16, 150, 157, 157, 157, 109, 135, 158, 54,
+#> 161, 161, 141, 142, 141, 49, 89, 102, 27, 81, 52, 69, 140, 139, 92, 70, 62, 119, 25, 51, 3, 37, 34, 33, 11, 8, 28, 35, 20, 19, 38, 24, 140, 141, 149, 158, 149, 143, 143, 109, 143, 132, 112, 123, 81, 21, 37, 35, 35, 24, 29, 24, 24, 39, 19, 19, 3, 50, 51, 54, 67, 25, 59, 12, 1, 151, 155, 153, 109, 136, 153, 156, 150, 150, 102, 137, 80, 156, 162, 142, 110, 114, 162, 162, 147, 162, 159, 161, 158, 160, 156, 39, 60, 158, 160, 153, 113, 145, 141, 146, 160, 135, 159, 20, 148, 153, 74, 34, 137, 155, 55, 16,
+#> 23, 66, 143, 162, 149, 157, 162, 162, 162, 158, 155, 111, 139, 157, 157, 85, 41, 21, 146, 75, 152, 154, 153, 157, 119, 122, 139, 121, 138, 34, 89, 59, 34, 102, 17, 29, 33, 34, 29, 32, 24, 13, 17, 27, 5, 20, 88, 123, 137, 99, 130, 153, 150, 145, 144, 91, 111, 108, 144, 135, 129, 136, 129, 82, 33, 93, 28, 111, 44, 134, 142, 157, 160, 158, 155, 106, 143, 142, 151, 158, 161, 143, 145, 124, 66, 35, 154, 153, 152, 150, 135, 136, 85, 15, 29, 20, 133, 137, 143, 138, 103, 131, 83, 153, 130, 127, 87, 142,
+#> 136, 143, 38, 44, 100, 12, 33, 38, 38, 36, 35, 21, 29, 35, 36, 26, 29, 36, 75, 62, 73, 33, 35, 32, 6, 8, 7, 149, 98, 16, 101, 87, 52, 14, 149, 158, 111, 143, 154, 162, 139, 153, 155, 121, 142, 114, 40, 13, 14, 65, 144, 150, 135, 42, 89, 145, 139, 155, 154, 142, 153, 132, 97, 145, 141, 24, 25, 142, 155, 140, 107, 90, 134, 133, 154, 144, 115, 140, 70, 82, 33, 1, 66, 149, 161, 151, 114, 144, 157, 154, 146, 85, 155, 98, 118, 24, 95, 125, 50, 146, 72, 68, 87, 63, 161, 135, 40, 90, 152, 141, 143, 135,
+#> 155, 154, 154, 39, 133, 114, 100, 2, 36, 49, 53, 58, 131, 143, 89, 145, 147, 69, 98, 5, 52, 84, 9, 33, 26, 23, 9, 16, 19, 30, 122, 108, 149, 156, 131, 85, 29, 92, 127, 29, 9, 4, 26, 33, 35, 34, 34, 25, 30, 30, 8, 14, 4, 4, 11, 49, 51, 59, 66, 36, 80, 71, 47, 52, 28, 24, 75, 23, 46, 70, 54, 56, 94, 125, 105, 138, 138, 85, 11, 52, 19, 31, 26, 55, 54, 6, 6, 5, 4, 12, 19, 19, 39, 20, 148, 148, 112, 118, 154, 122, 154, 120, 137, 133, 93, 46, 56, 84, 83, 110, 129, 52, 84, 143, 81, 142, 136, 158, 69, 136,
+#> 151, 153, 151, 144, 156, 155, 151, 64, 148, 152, 153, 145, 92, 62, 108, 58, 60, 149, 132, 138, 148, 144, 144, 128, 128, 35, 95, 63, 6, 40, 85, 8, 67, 109, 130, 97, 118, 37, 49, 104, 110, 48, 26, 98, 148, 159, 157, 110, 139, 158, 144, 142, 154, 146, 135, 111, 149, 145, 44, 5, 38, 73, 78, 159, 157, 159, 154, 110, 138, 151, 153, 155, 151, 149, 129, 32, 72, 6, 111, 139, 138, 158, 108, 135, 125, 154, 160, 162, 159, 159, 154, 152, 49, 78, 87, 4, 5, 35, 56, 42, 34, 13, 17, 28, 35, 35, 24, 13, 16, 35, 36,
+#> 24, 32, 32, 31, 24, 14, 45, 63, 73, 67, 65, 69, 42, 54, 48, 55, 56, 49, 23, 142, 100, 143, 156, 157, 136, 98, 158, 137, 138, 148, 60, 76, 21, 149, 107, 112, 148, 152, 5, 37, 109, 141, 136, 141, 135, 68, 129, 113, 126, 83, 108, 158, 161, 154, 103, 135, 100, 26, 133, 147, 22, 33, 73, 105, 79, 93, 15, 78, 94, 67, 103, 95, 68, 130, 82, 118, 121, 97, 28, 47, 98, 136, 58, 32, 62, 9, 123, 153, 159, 106, 143, 158, 161, 163, 161, 141, 83, 147, 132, 126, 56, 90, 149, 63, 85, 161, 84, 62, 40, 11, 21, 35, 34,
+#> 32, 34, 27, 8, 34, 23, 13, 17, 11, 29, 31, 31, 30, 25, 5, 25, 72, 100, 136, 114, 58, 74, 141, 81, 26, 155, 135, 97, 82, 58, 31, 65, 76, 48, 60, 63, 73, 81, 12, 31, 34, 68, 36, 26, 16, 101, 72, 89, 110, 109, 42, 112, 139, 157, 159, 148, 159, 96, 149, 71, 75, 45, 98, 8, 26, 41, 14, 2, 115, 136, 107, 93, 143, 150, 159, 126, 136, 132, 151, 155, 123, 98, 87, 15, 6, 27, 13, 26, 20, 32, 33, 18, 33, 21, 14, 17, 28, 3, 26, 31, 45, 138, 110, 131, 59, 140, 96, 54, 38, 89, 89, 6, 66, 130, 27, 29, 9, 28, 162,
+#> 115, 133, 157, 151, 93, 139, 119, 139, 116, 124, 25, 140, 131, 114, 28, 80, 21, 4, 7, 22, 33, 33, 31, 36, 23, 30, 14, 30, 11, 23, 35, 35, 35, 35, 18, 35, 34, 33, 10, 30, 22, 7, 129, 61, 143, 155, 157, 138, 161, 155, 101, 143, 103, 107, 117, 38, 1, 63, 30, 161, 153, 152, 135, 143, 111, 143, 146, 137, 131, 78, 59, 64, 54, 4, 97, 120, 124, 31, 102, 135, 84, 44, 128, 83, 108, 109, 19, 81, 142, 159, 162, 142, 94, 139, 161, 143, 159, 156, 152, 140, 150, 147, 104, 58, 112, 139, 43, 74, 113, 152, 111, 140,
+#> 161, 141, 154, 139, 161, 139, 27, 6, 7, 24, 13, 15, 34, 51, 62, 69, 66, 44, 32, 68, 66, 71, 74, 61, 70, 55, 79, 16, 40, 8, 8, 25, 28, 63, 72, 52, 64, 61, 49, 57, 66, 37, 52, 137, 145, 103, 119, 124, 62, 122, 131, 9, 28, 33, 33, 12, 17, 29, 32, 33, 34, 33, 18, 19, 3, 22, 91, 137, 152, 150, 150, 147, 118, 142, 120, 154, 152, 152, 130, 133, 100, 53, 104, 24, 66, 5, 58, 144, 84, 135, 131, 143, 153, 113, 10, 20, 114, 12, 9, 105, 52, 139, 160, 159, 162, 158, 85, 122, 24, 143, 147, 148, 142, 15, 72, 21,
+#> 48, 109, 134, 112, 141, 116, 139, 159, 151, 161, 151, 30, 125, 107, 33, 25, 153, 116, 67, 159, 105, 144, 124, 162, 159, 162, 156, 160, 150, 137, 126, 102, 114, 27, 40, 47, 98, 137, 151, 147, 123, 146, 158, 156, 147, 159, 143, 59, 143, 130, 149, 107, 17, 108, 22, 71, 28, 30, 18, 94, 141, 114, 133, 154, 55, 152, 150, 144, 137, 153, 142, 110, 117, 85, 26, 13, 73, 12, 32, 25, 24, 32, 36, 33, 29, 31, 34, 34, 33, 31, 27, 30, 32, 28, 34, 35, 23, 41, 22, 29, 13, 19, 10, 15, 30, 22, 33, 9, 116, 138, 107,
+#> 133, 81, 86, 135, 133, 103, 126, 140, 130, 135, 93, 88, 24, 85, 62, 139, 108, 144, 143, 129, 128, 158, 141, 146, 154, 119, 148, 141, 131, 40, 89, 151, 159, 152, 161, 137, 157, 154, 160, 161, 157, 156, 111, 39, 90, 34, 105, 3, 28, 34, 24, 30, 35, 35, 29, 34, 33, 9, 4, 28, 18, 7, 25, 60, 58, 51, 137, 152, 158, 101, 126, 150, 157, 72, 87, 112, 19, 9, 8, 80, 100, 138, 123, 133, 65, 134, 128, 109, 129, 150, 103, 76, 18, 31, 22, 6, 67, 70, 52, 60, 62, 61, 63, 62, 62, 9, 59, 55, 67, 56, 53, 50, 56, 66,
+#> 13, 48, 10, 55, 18, 15, 157, 159, 149, 158, 148, 150, 157, 119, 154, 159, 154, 156, 150, 153, 157, 131, 159, 17, 145, 41, 149, 106, 55, 92, 56, 81, 33, 95, 39, 93, 57, 24, 107, 34, 56, 17, 48, 146, 141, 161, 129, 148, 162, 162, 161, 155, 162, 154, 158, 138, 124, 137, 99, 122, 44, 151, 49, 144, 90, 120, 141, 118, 37, 117, 119, 153, 149, 138, 109, 26, 104, 56, 56, 4, 31, 35, 35, 33, 31, 32, 31, 22, 33, 15, 33, 38, 36, 33, 32, 21, 12, 30, 4, 14, 4, 1, 4, 3, 1, 34, 20, 28, 33, 27, 28, 32, 31, 29, 33,
+#> 30, 30, 17, 16, 28, 39, 47, 55, 70, 70, 66, 64, 70, 62, 61, 9, 55, 60, 65, 61, 48, 55, 50, 2, 66, 24, 30, 33, 31, 33, 31, 29, 18, 30, 29, 33, 31, 23, 5, 20, 9, 22, 84, 152, 156, 154, 159, 159, 160, 111, 143, 162, 158, 162, 158, 158, 160, 155, 154, 154, 110, 151, 120, 153, 154, 45, 149, 144, 34, 23, 1, 17, 35, 20, 11, 34, 35, 36, 33, 36, 35, 11, 26, 34, 8, 23, 24, 8, 35, 31, 18, 26, 12, 29, 2, 55, 46, 9, 50, 78, 78, 39, 34, 64, 60, 77, 24, 153, 143, 135, 140, 21, 156, 156, 38, 43, 62, 122, 121, 55,
+#> 65, 37, 156, 160, 112, 128, 151, 100, 55, 154, 142, 56, 142, 112, 115, 40, 88, 133, 65, 92, 24, 36, 136, 109, 97, 141, 155, 158, 142, 159, 155, 154, 150, 138, 138, 131, 51, 18, 142, 115, 129, 123, 161, 96, 115, 83, 151, 119, 104, 7, 56, 50, 24, 32, 6, 30, 34, 32, 20, 19, 16, 30, 35, 7, 19, 61, 66, 54, 66, 66, 71, 45, 64, 74, 71, 63, 67, 64, 66, 61, 64, 9, 64, 18, 41, 54, 43, 40, 41, 32, 16, 11, 18, 34, 32, 30, 34, 35, 16, 31, 31, 31, 30, 8, 5, 7, 22, 36, 38, 70, 96, 123, 114, 129, 152, 133, 135,
+#> 120, 33, 76, 108, 138, 142, 139, 157, 152, 127, 158, 155, 159, 148, 14, 74, 31, 153, 159, 162, 161, 161, 154, 156, 154, 160, 156, 154, 75, 82, 107, 77, 94, 3, 6, 23, 27, 35, 32, 39, 33, 11, 10, 3, 20, 27, 8, 4, 5, 49, 33, 46, 40, 48, 24, 32, 34, 42, 73, 21, 47, 19, 15, 66, 80, 79, 59, 44, 34, 3, 24, 155, 148, 158, 154, 136, 55, 15, 108, 23, 26, 25, 29, 33, 32, 22, 21, 4, 22, 65, 58, 23, 24, 55, 10, 47, 73, 88, 114, 28, 21, 151, 153, 151, 126, 154, 85, 36, 98, 102, 90, 76, 113, 16, 81, 152, 148, 93,
+#> 36, 154, 49, 94, 152, 150, 145, 57, 4, 26, 38, 120, 145, 141, 154, 95, 108, 102, 43, 120, 158, 153, 127, 136, 69, 22, 1, 4, 28, 27, 33, 35, 35, 26, 26, 34, 33, 36, 35, 33, 20, 17, 32, 22, 13, 21, 33, 29, 17, 24, 15, 24, 9, 20, 28, 3, 14, 121, 132, 135, 158, 153, 162, 161, 158, 160, 157, 158, 115, 34, 130, 128, 59, 149, 135, 133, 119, 37, 96, 24, 16, 50, 134, 86, 145, 108, 34, 130, 131, 131, 118, 67, 38, 6, 96, 151, 133, 145, 120, 147, 146, 137, 53, 59, 143, 69, 8, 140, 157, 157, 160, 157, 156, 159,
+#> 158, 153, 137, 109, 110, 134, 128, 143, 95, 126, 112, 7, 68, 73, 61, 104, 7, 5, 42, 107, 74, 16, 1, 37, 62, 58, 66, 28, 64, 70, 78, 46, 75, 70, 66, 45, 15, 2, 71, 14, 156, 98, 155, 162, 141, 90, 69, 151, 140, 144, 161, 81, 64, 98, 44, 151, 145, 109, 133, 62, 48, 2, 63, 24, 42, 28, 17, 31, 11, 16, 2, 43, 37, 138, 153, 142, 152, 162, 162, 143, 161, 128, 144, 144, 139, 159, 26, 101, 123, 151, 144, 158, 150, 124, 135, 142, 139, 109, 18, 12, 9, 90, 159, 160, 154, 159, 161, 112, 156, 141, 156, 150, 143,
+#> 100, 152, 145, 13, 44, 24, 29, 34, 32, 34, 35, 43, 36, 32, 36, 12, 13, 21, 10, 16, 39, 34, 15, 33, 8, 25, 23, 27, 23, 11, 30, 34, 32, 26, 33, 34, 33, 34, 32, 8, 25, 34, 33, 30, 19, 10, 3, 15, 39, 52, 33, 36, 33, 18, 14, 20, 14, 38, 32, 4, 7, 33, 63, 64, 71, 13, 19, 45, 61, 33, 39, 54, 25, 56, 28, 27, 33, 34, 28, 30, 26, 31, 34, 29, 23, 10, 17, 18, 5, 98, 75, 60, 158, 157, 97, 61, 131, 65, 137, 145, 146, 138, 154, 141, 57, 139, 133, 142, 157, 157, 150, 67, 125, 153, 40, 87, 140, 107, 73, 69, 63, 81,
+#> 35, 24, 31, 30, 31, 34, 12, 19, 34, 20, 34, 33, 35, 30, 34, 11, 30, 28, 80, 106, 123, 108, 57, 128, 121, 110, 141, 122, 134, 47, 17, 83, 162, 157, 162, 87, 49, 145, 120, 23, 103, 154, 87, 21, 33, 35, 152, 159, 160, 159, 156, 160, 154, 144, 145, 154, 83, 151, 118, 124, 69, 124, 54, 140, 142, 153, 158, 152, 154, 155, 156, 80, 139, 139, 83, 145, 19, 83, 87, 64, 60, 71, 26, 37, 65, 140, 107, 125, 39, 89, 155, 137, 138, 159, 159, 152, 130, 145, 149, 115, 136, 121, 27, 48, 68, 51, 68, 65, 65, 67, 45, 24,
+#> 79, 26, 33, 51, 27, 68, 62, 63, 45, 17, 58, 73, 68, 58, 66, 60, 79, 33, 19, 61, 63, 69, 61, 35, 131, 79, 154, 156, 143, 154, 159, 138, 36, 150, 97, 37, 50, 121, 9, 48, 154, 159, 161, 156, 91, 58, 149, 153, 115, 151, 14, 128, 1, 8, 60, 111, 112, 151, 138, 143, 142, 137, 142, 143, 144, 51, 111, 120, 115, 21, 145, 157, 153, 160, 153, 160, 52, 82, 155, 157, 146, 131, 84, 92, 106, 154, 133, 154, 150, 141, 152, 157, 149, 153, 149, 124, 138, 124, 72, 96, 8, 118, 3, 151, 143, 142, 49, 78, 87, 91, 72, 125,
+#> 20, 16, 115, 153, 151, 153, 156, 125, 160, 137, 90, 23, 8, 33, 58, 113, 80, 44, 28, 11, 116, 141, 146, 155, 150, 158, 147, 140, 76, 141, 151, 120, 149, 48, 33, 45, 1, 6, 135, 99, 148, 148, 154, 138, 98, 147, 160, 146, 119, 152, 156, 140, 144, 142, 139, 157, 157, 159, 161, 162, 161, 161, 162, 146, 162, 161, 67, 95, 150, 143, 153, 24, 79, 113, 140, 79, 159, 37, 123, 154, 150, 61, 29, 49, 101, 103, 75, 50, 130, 128, 127, 150, 128, 130, 143, 129, 134, 139, 117, 81, 36, 21, 16, 79, 104, 125, 162, 153,
+#> 162, 58, 103, 141, 153, 155, 161, 59, 101, 123, 91, 39, 3, 1, 51, 107, 37, 50, 67, 141, 112, 89, 140, 150, 105, 122, 110, 130, 102, 107, 3, 44, 18, 71, 71, 77, 76, 73, 62, 9, 45, 15, 64, 30, 41, 36, 19, 8, 161, 157, 157, 154, 161, 143, 158, 148, 160, 159, 147, 154, 99, 159, 157, 12, 137, 122, 154, 112, 77, 56, 146, 152, 154, 153, 162, 162, 148, 156, 105, 155, 153, 139, 136, 9, 105, 46, 122, 152, 141, 156, 133, 129, 51, 73, 114, 122, 99, 140, 60, 27, 34, 30, 26, 33, 32, 17, 3, 3, 15, 9, 44, 62, 75,
+#> 73, 78, 72, 68, 79, 68, 33, 156, 137, 144, 143, 144, 129, 139, 87, 115, 129, 135, 114, 86, 5, 101, 119, 32, 117, 26, 7, 15, 42, 44, 69, 62, 14, 35, 35, 35, 34, 35, 34, 34, 32, 34, 34, 13, 32, 30, 3, 2, 31, 130, 96, 122, 119, 97, 119, 117, 134, 145, 132, 61, 57, 15, 10, 5, 62, 75, 66, 66, 69, 31, 68, 20, 20, 13, 26, 105, 159, 160, 162, 162, 162, 162, 162, 162, 133, 158, 158, 97, 59, 91, 53, 56, 68, 69, 84, 55, 24, 23, 151, 124, 155, 147, 31, 78, 84, 133, 39, 54, 131, 117, 91, 52, 7, 32, 33, 37, 22,
+#> 32, 21, 6, 44, 9, 22, 158, 156, 156, 145, 156, 159, 135, 109, 117, 147, 137, 151, 93, 58, 67, 5, 106, 150, 154, 156, 157, 159, 161, 158, 159, 112, 142, 141, 108, 145, 135, 80, 8, 12, 63, 74, 74, 67, 32, 33, 33, 35, 35, 33, 34, 34, 34, 34, 21, 17, 9, 4, 23, 24, 26, 29, 33, 30, 27, 32, 21, 30, 21, 7, 8, 20, 2, 36, 19, 17, 34, 36, 21, 19, 32, 31, 34, 32, 33, 32, 25, 13, 5, 20, 33, 77, 77, 70, 14, 2, 20, 34, 50, 22, 141, 70, 158, 158, 162, 155, 161, 158, 50, 150, 155, 141, 39, 109, 85, 28, 41, 75, 44,
+#> 128, 136, 134, 146, 152, 150, 122, 142, 85, 50, 87, 142, 86, 49, 55, 105, 106, 162, 146, 124, 158, 153, 64, 4, 47, 86, 91, 38, 16, 11, 54, 67, 72, 72, 65, 72, 72, 43, 44, 31, 15, 20, 158, 134, 159, 132, 9, 84, 21, 14, 27, 42, 40, 35, 38, 8, 7, 6, 10, 16, 55, 128, 145, 116, 153, 70, 103, 8, 146, 110, 150, 32, 24, 3, 30, 159, 161, 134, 156, 154, 149, 108, 158, 157, 131, 77, 130, 67, 83, 140, 153, 124, 152, 144, 110, 87, 126, 147, 85, 8, 97, 140, 146, 160, 130, 158, 150, 153, 154, 113, 119, 73, 68,
+#> 68, 145, 102, 152, 141, 116, 22, 32, 28, 32, 33, 25, 15, 13, 20, 12, 24, 35, 36, 33, 5, 26, 6, 8, 15, 86, 10, 130, 89, 125, 128, 150, 159, 151, 149, 109, 150, 145, 146, 90, 137, 142, 146, 30, 15, 27, 45, 34, 33, 34, 33, 34, 25, 29, 21, 46, 135, 158, 159, 106, 22, 32, 65, 45, 135, 114, 150, 18, 57, 5, 63, 11, 151, 84, 96, 93, 145, 97, 9, 61, 27, 3, 120, 162, 159, 145, 49, 106, 151, 95, 123, 70, 68, 146, 145, 162, 162, 54, 78, 103, 54, 156, 158, 156, 123, 15, 123, 111, 66, 53, 79, 128, 149, 96, 140,
+#> 149, 155, 126, 135, 125, 113, 42, 12, 49, 141, 147, 153, 147, 73, 56, 99, 127, 145, 159, 151, 120, 19, 73, 132, 140, 153, 91, 102, 21, 86, 154, 154, 105, 155, 133, 101, 107, 77, 152, 138, 126, 159, 158, 156, 156, 156, 149, 143, 111, 154, 124, 156, 161, 148, 143, 89, 10, 16, 134, 105, 115, 120, 23, 15, 59, 151, 152, 154, 162, 157, 158, 159, 162, 58, 98, 158, 156, 152, 154, 142, 8, 92, 78, 108, 147, 150, 157, 158, 142, 135, 87, 75, 31, 61, 17, 62, 40, 6, 26, 49, 142, 143, 156, 151, 137, 155, 158, 152,
+#> 151, 122, 152, 149, 149, 144, 126, 81, 14, 104, 135, 109, 135, 100, 145, 72, 146, 140, 109, 137, 139, 81, 9, 13, 6, 32, 33, 33, 11, 14, 11, 29, 29, 32, 29, 32, 6, 5, 19, 20, 4, 78, 73, 69, 64, 68, 68, 70, 48, 66, 67, 62, 1, 19, 31, 32, 30, 34, 16, 17, 34, 34, 33, 10, 19, 7, 12, 29, 24, 30, 31, 33, 14, 33, 24, 34, 34, 13, 28, 33, 32, 1, 4, 28, 35, 34, 3, 54, 142, 135, 131, 157, 139, 107, 149, 126, 119, 51, 35, 1, 86, 144, 139, 51, 132, 142, 137, 133, 103, 131, 131, 109, 39, 68, 28, 35, 21, 36, 35,
+#> 35, 33, 32, 30, 20, 15, 24, 17, 9, 12, 69, 74, 68, 76, 6, 9, 67, 69, 48, 63, 64, 44, 62, 40, 58, 28, 33, 62, 19, 88, 159, 144, 162, 160, 143, 152, 71, 80, 153, 129, 4, 49, 127, 131, 150, 127, 85, 30, 28, 8, 126, 89, 132, 117, 70, 134, 133, 107, 57, 44, 30, 7, 87, 160, 158, 158, 157, 160, 160, 150, 161, 161, 148, 159, 119, 127, 152, 150, 140, 158, 153, 162, 102, 59, 162, 115, 160, 157, 155, 66, 81, 15, 40, 30, 21, 35, 44, 46, 40, 39, 38, 17, 3, 25, 7, 17, 21, 10, 49, 85, 59, 79, 148, 85, 71, 154,
+#> 43, 100, 85, 66, 4, 109, 16, 32, 75, 38, 112, 159, 143, 138, 156, 155, 159, 59, 39, 17, 77, 91, 47, 145, 146, 161, 145, 159, 155, 154, 145, 150, 148, 149, 141, 143, 143, 145, 150, 64, 2, 106, 156, 160, 160, 159, 162, 156, 155, 135, 157, 159, 156, 21, 126, 6, 36, 34, 125, 149, 147, 52, 91, 132, 124, 119, 21, 46, 45, 88, 118, 144, 53, 94, 122, 126, 86, 43, 110, 142, 141, 153, 132, 122, 90, 118, 153, 152, 120, 142, 158, 123, 117, 18, 76, 136, 116, 4, 4, 19, 1, 1, 54, 64, 26, 69, 71, 74, 16, 38, 49,
+#> 23, 29, 35, 33, 33, 34, 34, 1, 78, 153, 156, 51, 105, 123, 148, 133, 150, 121, 81, 137, 134, 116, 86, 30, 40, 74, 141, 157, 157, 163, 135, 81, 69, 134, 127, 25, 135, 49, 8, 8, 23, 13, 4, 32, 35, 34, 33, 11, 21, 31, 32, 32, 35, 33, 30, 15, 15, 8, 5, 59, 69, 66, 69, 64, 76, 70, 53, 31, 42, 78, 23, 25, 69, 60, 2, 30, 32, 33, 35, 33, 34, 33, 34, 32, 20, 2, 158, 154, 153, 151, 142, 92, 64, 93, 86, 128, 105, 132, 122, 160, 159, 161, 160, 159, 161, 160, 157, 156, 7, 17, 53, 151, 144, 132, 150, 47, 97, 90,
+#> 35, 131, 140, 109, 146, 138, 137, 82, 147, 113, 120, 158, 43, 94, 147, 160, 132, 159, 156, 115, 103, 83, 131, 155, 34, 73, 59, 130, 139, 145, 138, 143, 128, 121, 102, 140, 135, 121, 125, 155, 158, 139, 93, 63, 158, 124, 157, 141, 156, 73, 6, 32, 32, 31, 34, 37, 37, 38, 35, 42, 25, 35, 69, 53, 161, 153, 160, 159, 36, 133, 126, 160, 93, 143, 47, 69, 69, 160, 154, 160, 160, 144, 157, 102, 156, 112, 134, 38, 34, 114, 156, 158, 153, 160, 132, 152, 153, 159, 136, 85, 37, 145, 32, 73, 17, 59, 59, 67, 66,
+#> 65, 63, 70, 61, 66, 37, 22, 22, 75, 40, 131, 142, 79, 18, 148, 139, 135, 144, 153, 160, 85, 4, 18, 16, 110, 144, 127, 152, 142, 54, 155, 104, 126, 48, 136, 50, 33, 33, 31, 30, 31, 28, 34, 18, 17, 34, 34, 33, 28, 32, 8, 29, 17, 32, 27, 30, 32, 37, 29, 3, 13, 17, 19, 32, 10, 13, 20, 12, 19, 72, 44, 147, 145, 145, 136, 102, 120, 42, 80, 28, 43, 158, 162, 162, 157, 106, 33, 71, 52, 60, 39, 58, 121, 151, 155, 143, 97, 125, 133, 127, 111, 129, 70, 162, 162, 155, 82, 75, 124, 15, 153, 148, 59, 22, 10, 119,
+#> 63, 126, 93, 140, 157, 109, 161, 152, 144, 105, 108, 14, 158, 154, 156, 154, 158, 158, 162, 137, 155, 88, 142, 156, 160, 138, 144, 39, 157, 158, 159, 162, 161, 162, 162, 162, 42, 158, 4, 50, 84, 92, 150, 159, 147, 126, 108, 106, 122, 60, 74, 42, 74, 26, 30, 63, 26, 54, 34, 31, 59, 26, 38, 70, 62, 37, 25, 68, 30, 42, 72, 76, 81, 68, 50, 47, 3, 54, 64, 72, 68, 47, 29, 60, 60, 57, 40, 18, 54, 29, 61, 44, 65, 74, 52, 60, 75, 71, 20, 21, 31, 139, 157, 154, 75, 159, 141, 160, 135, 93, 113, 151, 158, 157,
+#> 150, 154, 61, 135, 140, 35, 36, 4, 41, 27, 34, 6, 6, 22, 20, 1, 8, 1, 73, 68, 22, 11, 32, 72, 69, 18, 10, 16, 30, 32, 33, 31, 18, 11, 13, 27, 26, 23, 30, 36, 32, 34, 33, 31, 33, 30, 20, 12, 2, 9, 33, 32, 33, 20, 31, 22, 12, 13, 15, 35, 33, 34, 13, 6, 78, 80, 70, 78, 66, 72, 67, 50, 25, 11, 24, 34, 33, 33, 33, 33, 32, 34, 16, 16, 43, 156, 161, 162, 160, 160, 159, 123, 36, 157, 159, 156, 11, 112, 6, 6, 149, 158, 141, 153, 155, 150, 147, 151, 121, 148, 51, 114, 129, 111, 124, 140, 136, 139, 138, 136,
+#> 110, 136, 41, 106, 137, 152, 84, 45, 85, 81, 55, 34, 146, 79, 36, 21, 153, 131, 146, 156, 147, 132, 53, 101, 122, 30, 33, 38, 72, 18, 73, 158, 142, 63, 96, 145, 123, 157, 132, 149, 82, 124, 149, 149, 92, 133, 81, 56, 15, 12, 33, 32, 32, 31, 33, 33, 21, 11, 32, 122, 157, 151, 133, 74, 160, 162, 160, 1, 11, 18, 141, 102, 105, 125, 52, 47, 54, 14, 10, 78, 39, 111, 113, 162, 157, 154, 68, 63, 151, 154, 110, 40, 157, 150, 52, 90, 156, 89, 133, 121, 148, 151, 89, 50, 57, 81, 130, 99, 131, 118, 86, 82,
+#> 50, 23, 39, 8, 15, 19, 120, 152, 139, 59, 77, 38, 101, 125, 38, 112, 63, 151, 152, 156, 151, 143, 109, 156, 154, 130, 31, 116, 105, 69, 105, 155, 160, 55, 158, 138, 33, 104, 156, 87, 133, 116, 10, 8, 24, 33, 3, 52, 32, 33, 33, 29, 13, 24, 29, 32, 32, 32, 41, 132, 119, 149, 151, 162, 160, 159, 137, 28, 32, 34, 35, 35, 33, 32, 30, 34, 33, 33, 31, 31, 33, 32, 32, 20, 157, 162, 106, 157, 142, 101, 145, 147, 61, 95, 17, 105, 138, 157, 141, 53, 105, 155, 130, 106, 46, 95, 52, 98, 155, 159, 162, 161, 106,
+#> 73, 150, 154, 3, 61, 37, 25, 40, 37, 33, 35, 32, 7, 130, 109, 144, 149, 144, 77, 51, 27, 17, 42, 22, 81, 74, 68, 67, 64, 73, 69, 13, 68, 47, 42, 19, 30, 10, 128, 91, 65, 39, 70, 125, 148, 18, 89, 88, 151, 150, 125, 93, 143, 96, 149, 126, 153, 141, 160, 139, 135, 149, 142, 130, 142, 6, 38, 41, 32, 32, 32, 20, 46, 69, 74, 62, 59, 21, 163, 162, 162, 51, 143, 93, 142, 145, 141, 34, 6, 28, 14, 29, 31, 26, 12, 22, 26, 29, 31, 24, 33, 36, 34, 34, 27, 29, 35, 34, 23, 7, 35, 33, 29, 21, 31, 24, 12, 31, 30,
+#> 31, 34, 34, 33, 33, 31, 34, 31, 7, 43, 100, 134, 153, 152, 92, 40, 41, 59, 85, 89, 145, 127, 135, 110, 70, 153, 21, 24, 9, 6, 32, 35, 35, 34, 40, 36, 34, 36, 32, 32, 15, 25, 155, 101, 151, 122, 143, 47, 126, 91, 87, 41, 16, 13, 23, 12, 11, 117, 142, 107, 21, 113, 161, 149, 92, 118, 155, 153, 24, 151, 131, 150, 161, 111, 162, 62, 158, 6, 14, 2, 91, 8, 66, 145, 151, 120, 33, 121, 130, 94, 83, 9, 14, 24, 27, 32, 35, 37, 49, 52, 45, 45, 35, 32, 33, 23, 31, 30, 21, 32, 33, 11, 40, 6, 7, 53, 71, 14, 77,
+#> 64, 42, 69, 68, 64, 6, 20, 70, 64, 8, 6, 30, 30, 18, 7, 108, 45, 148, 148, 147, 150, 136, 148, 156, 158, 158, 158, 158, 154, 154, 159, 146, 158, 159, 161, 154, 136, 48, 4, 67, 20, 4, 31, 33, 33, 33, 33, 33, 33, 8, 41, 96, 31, 128, 108, 124, 159, 109, 159, 152, 17, 70, 97, 144, 138, 134, 121, 33, 145, 153, 18, 158, 74, 134, 149, 111, 22, 31, 32, 33, 34, 35, 27, 34, 96, 130, 139, 144, 148, 26, 75, 151, 134, 49, 74, 151, 161, 156, 156, 104, 147, 161, 157, 161, 160, 160, 104, 160, 155, 156, 34, 79, 98,
+#> 137, 138, 143, 141, 138, 156, 156, 120, 133, 141, 133, 156, 104, 46, 55, 100, 92, 124, 159, 158, 159, 161, 162, 151, 151, 7, 50, 74, 75, 62, 13, 49, 13, 60, 10, 29, 31, 32, 13, 29, 21, 79, 63, 68, 63, 61, 29, 104, 141, 116, 102, 124, 67, 9, 47, 159, 158, 141, 160, 136, 156, 160, 61, 155, 157, 45, 114, 131, 97, 151, 143, 136, 97, 49, 143, 43, 108, 138, 133, 159, 150, 149, 154, 150, 6, 11, 3, 33, 9, 3, 64, 30, 162, 152, 108, 153, 40, 84, 151, 80, 23, 83, 52, 6, 130, 150, 129, 154, 147, 155, 113, 88,
+#> 139, 158, 41, 153, 152, 117, 108, 141, 157, 126, 4, 38, 25, 9, 1, 32, 35, 27, 33, 34, 34, 35, 33, 20, 27, 39, 63, 48, 38, 73, 72, 39, 76, 68, 69, 14, 54, 5, 23, 32, 34, 31, 27, 11, 23, 21, 11, 27, 29, 87, 156, 114, 109, 149, 124, 35, 151, 146, 115, 101, 129, 158, 159, 141, 114, 110, 141, 149, 152, 136, 57, 6, 87, 151, 43, 154, 152, 140, 127, 30, 143, 156, 141, 72, 22, 2, 15, 8, 91, 156, 161, 113, 161, 141, 58, 77, 156, 108, 154, 158, 157, 157, 146, 157, 142, 128, 158, 104, 149, 154, 27, 48, 137,
+#> 118, 117, 104, 145, 144, 150, 113, 95, 61, 127, 5, 40, 139, 157, 157, 159, 139, 118, 100, 153, 7, 9, 33, 114, 130, 137, 131, 128, 140, 136, 134, 138, 128, 129, 135, 134, 72, 30, 113, 12, 16, 142, 144, 102, 133, 114, 136, 145, 111, 24, 68, 9, 26, 108, 101, 148, 157, 155, 160, 137, 157, 12, 5, 28, 30, 34, 23, 21, 154, 154, 130, 158, 154, 156, 12, 43, 43, 22, 37, 73, 64, 43, 17, 31, 31, 33, 32, 32, 33, 34, 128, 152, 159, 131, 158, 51, 156, 82, 162, 39, 76, 138, 150, 142, 48, 145, 160, 109, 159, 133,
+#> 111, 157, 58, 153, 137, 97, 94, 137, 147, 148, 41, 74, 49, 157, 146, 147, 15, 19, 30, 88, 87, 60, 28, 8, 11, 80, 113, 45, 31, 28, 139, 160, 127, 160, 7, 114, 157, 158, 154, 95, 74, 149, 152, 122, 150, 8, 41, 35, 115, 126, 150, 144, 71, 153, 157, 139, 101, 130, 49, 117, 43, 6, 61, 115, 133, 140, 49, 87, 160, 140, 160, 7, 31, 31, 30, 18, 14, 4, 4, 20, 30, 34, 9, 116, 157, 155, 22, 92, 160, 60, 49, 3, 12, 26, 36, 32, 53, 155, 160, 159, 161, 17, 33, 30, 33, 37, 81, 109, 149, 150, 121, 116, 143, 62, 144,
+#> 126, 100, 150, 123, 116, 145, 74, 4, 20, 35, 32, 31, 34, 36, 145, 154, 23, 31, 57, 147, 152, 158, 154, 43, 88, 135, 95, 28, 72, 114, 149, 151, 156, 137, 17, 110, 159, 129, 133, 137, 151, 98, 153, 80, 9, 38, 145, 158, 155, 158, 162, 148, 10, 27, 29, 18, 22, 24, 5, 9, 26, 33, 1, 108, 151, 129, 135, 51, 101, 102, 57, 21, 58, 127, 159, 56, 87, 38, 148, 145, 31, 137, 75, 157, 47, 135, 135, 153, 66, 143, 149, 153, 143, 14, 75, 158, 158, 158, 49, 155, 109, 156, 161, 143, 130, 99, 151, 57, 43, 27, 152, 51,
+#> 134, 156, 39, 59, 158, 53, 113, 86, 123, 158, 18, 144, 156) x c(245, 289, 182, 259, 236, 257, 282, 10, 30, 162, 23, 49, 181, 271, 308, 305, 261, 257, 409, 374, 361, 379, 442, 490, 411, 487, 478, 513, 486, 273, 121, 206, 340, 332, 316, 297, 343, 370, 211, 327, 340, 21, 270, 326, 381, 361, 249, 253, 175, 79, 122, 154, 96, 76, 297, 206, 579, 517, 529, 534, 577, 521, 419, 43, 152, 189, 259, 210, 166, 205, 191, 181, 149, 92, 21, 29, 117, 79, 11, 84, 283, 210, 215, 205, 262, 173, 187, 57, 101, 131, 55, 103, 284, 220, 256, 212, 186, 179, 144, 138, 8, 298, 584, 596,
+#> 536, 612, 560, 539, 531, 527, 550, 568, 588, 181, 285, 46, 40, 1, 65, 174, 196, 187, 186, 140, 180, 153, 154, 148, 124, 153, 148, 137, 148, 120, 104, 125, 115, 107, 55, 25, 16, 175, 545, 608, 312, 451, 544, 348, 4, 485, 553, 249, 602, 509, 581, 469, 591, 315, 448, 465, 419, 490, 426, 6, 34, 81, 98, 3, 112, 115, 139, 116, 86, 101, 91, 75, 9, 11, 130, 127, 124, 133, 127, 91, 107, 129, 95, 107, 112, 110, 103, 105, 51, 5, 17, 465, 597, 498, 405, 474, 524, 527, 522, 384, 146, 291, 206, 567, 542, 602,
+#> 259, 408, 38, 560, 534, 288, 165, 561, 570, 547, 69, 359, 5, 138, 287, 258, 288, 268, 266, 317, 299, 313, 17, 226, 237, 212, 69, 2, 74, 238, 367, 263, 111, 371, 323, 387, 329, 430, 265, 142, 256, 91, 0, 0, 127, 389, 515, 555, 550, 562, 575, 563, 582, 591, 589, 588, 574, 581, 609, 582, 612, 322, 104, 2, 635, 581, 596, 588, 310, 562, 41, 58, 99, 154, 157, 84, 138, 158, 136, 32, 16, 11, 0, 4, 103, 114, 76, 97, 100, 114, 97, 80, 36, 103, 13, 13, 135, 161, 124, 140, 130, 91, 109, 82, 45, 69, 60, 13, 12,
+#> 0, 2, 150, 358, 605, 581, 573, 506, 591, 553, 428, 345, 563, 542, 588, 421, 497, 428, 507, 526, 556, 625, 415, 233, 490, 353, 13, 98, 149, 516, 593, 577, 485, 550, 494, 511, 541, 587, 476, 538, 487, 403, 508, 410, 323, 147, 73, 13, 18, 10, 98, 474, 525, 498, 491, 534, 491, 493, 260, 436, 210, 16, 2, 295, 235, 178, 406, 402, 331, 405, 328, 449, 234, 234, 227, 108, 162, 248, 221, 51, 256, 431, 491, 452, 380, 343, 334, 424, 297, 241, 80, 252, 209, 266, 276, 476, 143, 496, 236, 132, 606, 121, 593, 222,
+#> 12, 244, 31, 310, 550, 517, 518, 599, 602, 399, 527, 459, 427, 278, 525, 417, 501, 551, 550, 429, 392, 13, 2, 2, 77, 89, 93, 98, 85, 121, 125, 103, 91, 31, 54, 19, 59, 82, 16, 97, 117, 101, 110, 104, 102, 87, 34, 42, 11, 237, 588, 571, 527, 549, 534, 512, 490, 548, 516, 515, 568, 495, 556, 473, 558, 413, 552, 566, 432, 230, 86, 173, 348, 566, 488, 603, 437, 451, 489, 447, 533, 549, 544, 554, 583, 375, 369, 90, 464, 532, 340, 533, 508, 416, 463, 433, 155, 478, 446, 491, 278, 241, 83, 183, 3, 0, 117,
+#> 134, 88, 107, 150, 128, 148, 131, 115, 103, 103, 103, 66, 110, 83, 63, 99, 86, 56, 67, 55, 29, 12, 74, 92, 33, 3, 84, 493, 563, 342, 386, 538, 559, 577, 553, 497, 465, 550, 230, 177, 149, 103, 267, 15, 23, 330, 571, 581, 493, 543, 534, 526, 521, 545, 564, 330, 518, 602, 526, 598, 505, 556, 425, 375, 226, 33, 7, 2, 109, 149, 280, 342, 232, 266, 256, 178, 95, 63, 33, 12, 2, 91, 394, 407, 257, 216, 88, 1, 19, 116, 544, 538, 500, 580, 520, 571, 547, 546, 523, 471, 494, 552, 506, 426, 574, 486, 429, 539,
+#> 523, 191, 99, 120, 134, 129, 126, 73, 123, 89, 96, 86, 94, 90, 76, 60, 93, 81, 38, 36, 79, 101, 137, 128, 144, 134, 136, 147, 142, 130, 150, 125, 64, 111, 108, 93, 113, 97, 103, 46, 120, 126, 155, 135, 142, 157, 125, 126, 129, 98, 90, 20, 21, 77, 10, 7, 55, 69, 88, 124, 56, 43, 54, 6, 422, 192, 137, 194, 505, 68, 532, 496, 561, 511, 597, 596, 561, 550, 581, 500, 509, 506, 402, 84, 134, 22, 135, 259, 382, 486, 510, 482, 311, 300, 118, 274, 351, 84, 82, 2, 1, 7, 39, 83, 103, 53, 114, 97, 85, 22, 9,
+#> 92, 89, 63, 56, 55, 11, 31, 9, 147, 192, 149, 241, 240, 441, 451, 392, 474, 382, 452, 324, 295, 88, 5, 24, 0, 10, 406, 160, 374, 514, 507, 579, 499, 476, 547, 583, 587, 529, 386, 265, 97, 456, 577, 335, 72, 16, 3, 60, 72, 87, 88, 84, 98, 16, 59, 87, 7, 2, 26, 287, 195, 470, 411, 527, 477, 512, 125, 53, 83, 515, 346, 16, 27, 115, 208, 101, 256, 180, 297, 139, 53, 3, 0, 82, 176, 215, 229, 351, 351, 258, 137, 42, 67, 48, 220, 83, 132, 141, 110, 3, 11, 75, 61, 44, 113, 2, 120, 79, 92, 99, 100, 50, 93,
+#> 93, 79, 60, 78, 62, 60, 43, 39, 0, 20, 42, 261, 313, 387, 385, 368, 248, 309, 205, 2, 22, 26, 58, 364, 603, 563, 503, 508, 522, 519, 445, 464, 470, 544, 571, 419, 246, 137, 400, 163, 4, 91, 79, 5, 15, 42, 13, 31, 541, 561, 592, 577, 564, 570, 360, 553, 504, 567, 330, 234, 1, 252, 275, 503, 394, 241, 400, 300, 291, 297, 186, 120, 238, 5, 85, 97, 99, 19, 34, 20, 18, 71, 14, 23, 17, 75, 571, 572, 528, 453, 158, 303, 592, 538, 65, 516, 570, 333, 188, 355, 380, 351, 313, 435, 468, 331, 247, 184, 129,
+#> 118, 31, 124, 17, 220, 365, 391, 371, 378, 381, 289, 239, 132, 68, 138, 102, 103, 137, 130, 138, 139, 10, 70, 118, 95, 85, 111, 65, 79, 15, 50, 94, 86, 41, 4, 552, 573, 559, 508, 474, 544, 478, 468, 396, 537, 553, 516, 610, 500, 405, 227, 377, 570, 575, 526, 558, 482, 539, 591, 38, 441, 476, 257, 381, 471, 13, 46, 268, 537, 570, 425, 314, 541, 257, 573, 505, 386, 76, 52, 1, 54, 27, 104, 96, 105, 84, 8, 55, 63, 75, 76, 23, 59, 95, 63, 86, 11, 22, 46, 73, 468, 568, 543, 576, 456, 512, 567, 423, 440,
+#> 559, 584, 537, 607, 581, 155, 127, 0, 10, 37, 413, 492, 517, 473, 553, 430, 493, 501, 463, 524, 597, 586, 470, 79, 50, 104, 149, 186, 229, 151, 120, 100, 350, 292, 364, 186, 98, 62, 379, 10, 263, 5, 56, 32, 385, 526, 430, 491, 261, 504, 365, 267, 8, 8, 9, 113, 183, 335, 535, 557, 447, 564, 520, 398, 151, 585, 463, 444, 50, 395, 322, 506, 560, 540, 454, 451, 328, 555, 546, 461, 270, 487, 92, 529, 569, 536, 544, 583, 580, 580, 348, 355, 82, 95, 117, 103, 94, 61, 22, 207, 307, 359, 338, 316, 225, 330,
+#> 387, 424, 408, 272, 356, 167, 285, 264, 245, 249, 92, 76, 21, 32, 106, 86, 17, 27, 52, 82, 40, 84, 125, 15, 57, 27, 135, 409, 487, 442, 483, 455, 467, 248, 194, 330, 388, 108, 70, 492, 506, 503, 132, 277, 50, 6, 436, 525, 499, 522, 448, 503, 426, 214, 45, 102, 606, 534, 453, 535, 533, 528, 568, 362, 409, 536, 583, 568, 600, 349, 566, 616, 411, 247, 63, 401, 392, 413, 410, 424, 333, 394, 485, 416, 442, 382, 153, 343, 226, 26, 1, 2, 83, 68, 53, 85, 104, 43, 71, 57, 82, 19, 50, 86, 571, 586, 509, 604,
+#> 561, 38, 480, 493, 612, 672, 581, 594, 266, 234, 29, 366, 560, 558, 562, 571, 478, 67, 57, 310, 307, 237, 339, 347, 399, 323, 245, 364, 295, 260, 171, 192, 146, 10, 1, 17, 51, 605, 561, 622, 623, 597, 465, 534, 631, 605, 631, 614, 336, 349, 47, 129, 21, 2, 187, 548, 530, 158, 404, 284, 85, 74, 71, 12, 97, 86, 95, 52, 42, 48, 397, 2, 455, 587, 553, 599, 493, 448, 550, 357, 426, 465, 559, 65, 35, 35, 18, 21, 326, 473, 406, 313, 112, 92, 154, 264, 309, 318, 402, 354, 325, 148, 194, 563, 477, 478, 499,
+#> 335, 442, 171, 606, 651, 444, 319, 479, 453, 375, 515, 358, 17, 259, 451, 519, 537, 497, 498, 21, 166, 62, 156, 94, 518, 405, 468, 351, 435, 590, 562, 584, 535, 558, 314, 336, 492, 238, 65, 17, 1, 20, 92, 110, 31, 2, 63, 60, 11, 17, 2, 13, 274, 580, 539, 452, 511, 631, 582, 586, 636, 649, 613, 614, 491, 49, 629, 431, 10, 92, 136, 123, 317, 432, 457, 540, 406, 522, 529, 359, 495, 540, 536, 499, 518, 534, 457, 459, 365, 72, 160, 130, 380, 294, 247, 482, 290, 498, 579, 281, 280, 417, 473, 275, 193,
+#> 305, 57, 495, 523, 416, 512, 589, 592, 623, 424, 536, 504, 527, 568, 486, 602, 104, 357, 58, 9, 83, 23, 24, 5, 56, 14, 97, 4, 96, 5, 366, 316, 349, 154, 219, 214, 164, 221, 48, 122, 191, 114, 16, 25, 2, 256, 544, 587, 532, 96, 0, 500, 36, 230, 47, 523, 533, 541, 563, 582, 447, 420, 571, 629, 427, 546, 575, 206, 502, 556, 7, 72, 51, 85, 71, 13, 53, 91, 86, 67, 57, 112, 86, 99, 112, 109, 508, 375, 570, 346, 563, 446, 433, 435, 29, 193, 16, 268, 360, 299, 320, 286, 409, 331, 315, 191, 133, 10, 166,
+#> 551, 272, 69, 522, 435, 504, 579, 418, 165, 527, 483, 540, 563, 570, 163, 450, 376, 6, 427, 587, 620, 593, 564, 599, 588, 468, 244, 485, 521, 629, 610, 599, 542, 100, 324, 538, 296, 23, 13, 26, 92, 60, 79, 103, 95, 101, 113, 122, 108, 107, 104, 82, 18, 4, 27, 215, 234, 269, 386, 378, 370, 359, 398, 489, 335, 392, 330, 307, 91, 191, 24, 255, 584, 524, 590, 586, 530, 566, 575, 559, 474, 491, 536, 419, 602, 576, 476, 442, 1, 75, 49, 21, 30, 21, 97, 86, 104, 100, 96, 98, 102, 41, 509, 430, 301, 558,
+#> 592, 260, 286, 357, 592, 583, 566, 581, 487, 463, 512, 488, 350, 499, 143, 17, 69, 90, 69, 111, 114, 93, 126, 124, 96, 81, 96, 131, 91, 16, 57, 76, 44, 20, 5, 2, 7, 0, 45, 236, 0, 340, 570, 540, 552, 543, 446, 453, 534, 577, 520, 568, 523, 422, 147, 217, 17, 365, 227, 509, 564, 481, 492, 639, 587, 581, 603, 561, 615, 8, 22, 43, 227, 605, 412, 471, 407, 512, 582, 549, 618, 330, 124, 6, 1, 1, 17, 48, 101, 18, 120, 108, 92, 77, 68, 11, 90, 81, 59, 23, 8, 197, 586, 23, 557, 624, 561, 633, 595, 646, 649,
+#> 641, 603, 616, 616, 593, 413, 288, 85, 335, 5, 90, 108, 99, 89, 131, 76, 42, 20, 7, 75, 97, 110, 94, 111, 116, 99, 79, 82, 81, 82, 6, 19, 21, 45, 34, 58, 80, 104, 115, 80, 67, 64, 76, 54, 0, 539, 359, 366, 528, 443, 507, 569, 576, 557, 533, 548, 60, 103, 143, 6, 184, 183, 323, 267, 310, 393, 152, 335, 177, 87, 26, 474, 489, 581, 504, 559, 596, 526, 500, 372, 55, 84, 63, 69, 24, 54, 104, 108, 125, 69, 54, 77, 60, 37, 70, 78, 49, 53, 18, 18, 38, 77, 107, 104, 53, 45, 109, 143, 92, 27, 83, 16, 98, 32,
+#> 27, 34, 190, 440, 618, 514, 641, 603, 502, 545, 617, 547, 527, 540, 518, 486, 585, 550, 354, 303, 32, 38, 76, 7, 23, 107, 590, 587, 592, 560, 571, 586, 499, 222, 402, 577, 166, 188, 202, 164, 469, 310, 478, 550, 632, 614, 499, 282, 126, 68, 28, 40, 70, 95, 63, 35, 97, 89, 98, 63, 57, 51, 5, 1, 7, 13, 58, 45, 134, 411, 387, 491, 461, 341, 252, 644, 610, 404, 434, 387, 312, 125, 17, 4, 70, 74, 49, 100, 80, 98, 5, 102, 120, 95, 113, 124, 102, 49, 30, 4, 5, 15, 51, 94, 94, 101, 95, 81, 61, 51, 47, 39,
+#> 38, 54, 20, 53, 47, 26, 55, 97, 94, 47, 101, 101, 109, 107, 84, 103, 84, 81, 104, 65, 55, 40, 34, 35, 44, 24, 3, 92, 104, 97, 125, 117, 62, 108, 21, 92, 80, 31, 479, 545, 587, 349, 523, 610, 588, 577, 569, 589, 178, 574, 443, 272, 20, 18, 218, 305, 492, 538, 505, 500, 392, 140, 148, 137, 29, 76, 38, 47, 1, 182, 451, 556, 286, 537, 543, 602, 455, 524, 570, 573, 502, 505, 558, 453, 459, 31, 43, 32, 94, 109, 144, 107, 101, 132, 79, 98, 108, 117, 90, 55, 0, 5, 20, 5, 21, 12, 14, 69, 91, 105, 74, 102,
+#> 112, 126, 88, 34, 46, 68, 46, 19, 3, 70, 572, 558, 553, 594, 608, 578, 569, 588, 578, 353, 484, 503, 524, 22, 141, 44, 533, 562, 593, 563, 542, 519, 524, 543, 547, 463, 429, 531, 570, 384, 267, 8, 132, 3, 0, 8, 113, 125, 270, 260, 392, 452, 183, 22, 317, 492, 178, 133, 52, 248, 249, 174, 67, 163, 67, 123, 10, 2, 2, 28, 32, 64, 111, 86, 104, 73, 102, 78, 83, 67, 54, 75, 30, 25, 19, 7, 1, 3, 42, 101, 115, 77, 73, 39, 13, 43, 5, 3, 1, 0, 89, 83, 106, 98, 55, 90, 96, 74, 89, 67, 56, 28, 4, 15, 17, 41,
+#> 336, 393, 502, 521, 493, 622, 591, 405, 516, 376, 453, 522, 542, 543, 442, 74, 291, 108, 112, 15, 2, 77, 388, 372, 383, 379, 344, 174, 200, 68, 145, 345, 35, 416, 17, 370, 536, 567, 644, 594, 557, 555, 489, 433, 364, 366, 43, 16, 79, 0, 122, 84, 61, 92, 50, 60, 56, 44, 15, 9, 56, 6, 18, 8, 24, 75, 77, 85, 65, 83, 101, 99, 85, 69, 74, 51, 60, 66, 53, 21, 14, 8, 327, 596, 411, 385, 469, 537, 551, 431, 555, 195, 122, 523, 511, 465, 52, 19, 571, 616, 545, 591, 574, 573, 569, 540, 497, 615, 513, 624,
+#> 444, 204, 12, 72, 231, 354, 398, 284, 449, 388, 22, 508, 380, 406, 490, 438, 413, 424, 356, 299, 306, 64, 150, 61, 379, 402, 522, 487, 503, 518, 220, 476, 570, 507, 501, 285, 320, 319, 127, 184, 59, 14, 17, 6, 233, 261, 358, 361, 449, 501, 393, 368, 428, 350, 188, 198, 83, 50, 136, 63, 57, 420, 370, 432, 468, 514, 487, 459, 518, 429, 437, 411, 126, 98, 594, 654, 583, 406, 464, 581, 554, 513, 670, 605, 558, 525, 568, 419, 470, 330, 21, 81, 24, 133, 6, 50, 358, 600, 579, 601, 568, 581, 456, 553, 396,
+#> 188, 591, 572, 549, 614, 590, 572, 181, 57, 5, 77, 97, 104, 110, 91, 91, 122, 33, 73, 91, 97, 82, 70, 57, 72, 61, 75, 74, 67, 14, 3, 0, 40, 466, 617, 614, 285, 499, 509, 642, 613, 446, 262, 559, 157, 223, 567, 406, 253, 616, 614, 458, 570, 407, 25, 532, 268, 446, 192, 25, 151, 523, 528, 619, 603, 574, 576, 560, 487, 382, 311, 549, 556, 399, 544, 109, 36, 262, 229, 234, 191, 34, 59, 111, 329, 292, 189, 85, 58, 145, 10, 38, 88, 96, 73, 109, 106, 64, 48, 60, 10, 33, 2, 2, 3, 478, 392, 479, 407, 505,
+#> 470, 56, 60, 244, 558, 551, 462, 488, 603, 549, 209, 4, 9, 49, 544, 528, 509, 480, 540, 552, 523, 331, 59, 410, 524, 447, 386, 18, 308, 422, 278, 498, 593, 638, 574, 198, 356, 616, 625, 658, 556, 479, 313, 466, 51, 13, 12, 33, 326, 458, 546, 385, 605, 600, 16, 503, 35, 65, 81, 80, 88, 102, 110, 115, 107, 105, 37, 89, 80, 91, 54, 67, 53, 45, 86, 71, 83, 83, 78, 86, 102, 75, 19, 4, 10, 383, 180, 529, 551, 520, 574, 585, 395, 481, 360, 172, 20, 49, 5, 43, 85, 34, 56, 5, 76, 93, 96, 67, 25, 19, 39, 20,
+#> 2, 50, 97, 91, 81, 67, 13, 12, 26, 12, 437, 572, 584, 562, 553, 581, 619, 596, 593, 579, 535, 579, 569, 576, 28, 589, 570, 404, 545, 571, 484, 510, 523, 438, 477, 537, 446, 120, 39, 44, 1, 38, 43, 99, 92, 84, 75, 79, 76, 99, 109, 76, 46, 16, 30, 43, 6, 31, 32, 56, 54, 39, 48, 12, 3, 86, 95, 96, 98, 56, 87, 13, 42, 42, 38, 3, 0, 58, 4, 4, 13, 91, 122, 73, 96, 80, 90, 76, 85, 40, 69, 15, 67, 48, 57, 31, 33, 1, 108, 94, 72, 99, 74, 74, 61, 114, 87, 69, 65, 45, 27, 30, 19, 33, 30, 22, 536, 623, 602,
+#> 596, 589, 559, 630, 618, 599, 549, 585, 619, 625, 461, 238, 35, 294, 333, 225, 136, 7, 0, 7, 163, 489, 225, 580, 568, 607, 633, 611, 643, 475, 602, 596, 229, 252, 280, 335, 279, 443, 70, 411, 394, 362, 383, 274, 369, 277, 290, 230, 87, 2, 3, 37, 629, 659, 662, 260, 681, 565, 500, 611, 537, 414, 537, 619, 379, 166, 51, 164, 4, 287, 14, 14, 19, 38, 23, 22, 80, 96, 25, 76, 88, 122, 102, 30, 32, 93, 20, 4, 91, 69, 19, 38, 31, 33, 58, 78, 18, 50, 112, 86, 62, 10, 66, 54, 53, 7, 20, 91, 358, 225, 346,
+#> 520, 517, 446, 450, 253, 568, 535, 59, 257, 62, 48, 63, 44, 88, 83, 75, 73, 90, 72, 84, 70, 42, 19, 46, 0, 1, 79, 356, 543, 562, 646, 549, 609, 303, 595, 538, 383, 342, 106, 297, 291, 237, 57, 467, 428, 263, 566, 129, 465, 108, 37, 59, 13, 18, 459, 508, 603, 634, 610, 383, 618, 628, 601, 610, 641, 564, 568, 406, 515, 436, 45, 186, 49, 546, 613, 501, 416, 410, 465, 429, 417, 242, 401, 435, 355, 558, 554, 456, 403, 435, 85, 89, 1, 35, 593, 606, 648, 626, 586, 532, 563, 591, 417, 251, 298, 57, 87, 114,
+#> 114, 91, 44, 79, 60, 7, 33, 18, 57, 67, 51, 42, 101, 103, 54, 79, 62, 32, 0, 4, 93, 118, 116, 128, 140, 78, 150, 135, 33, 106, 12, 49, 8, 2, 4, 23, 560, 557, 614, 605, 515, 52, 467, 14, 171, 252, 391, 566, 157, 43, 99, 1, 95, 105, 105, 79, 78, 63, 64, 15, 51, 33, 2, 33, 20, 76, 150, 73, 140, 113, 153, 150, 122, 105, 66, 108, 82, 46, 47, 93, 86, 83, 108, 109, 117, 109, 110, 97, 58, 53, 81, 57, 60, 20, 16, 12, 9, 35, 354, 638, 528, 512, 595, 159, 229, 177, 9, 32, 130, 400, 517, 562, 515, 585, 573,
+#> 539, 535, 585, 569, 565, 467, 515, 487, 100, 205, 20, 224, 597, 534, 627, 631, 599, 598, 563, 614, 609, 482, 55, 309, 118, 17, 83, 22, 227, 494, 587, 611, 557, 602, 504, 556, 295, 570, 530, 520, 548, 518, 79, 77, 191, 8, 3, 16, 26, 81, 81, 56, 80, 55, 56, 47, 9, 21, 26, 385, 356, 132, 494, 574, 617, 612, 496, 552, 400, 62, 327, 56, 1, 41, 2, 64, 46, 87, 86, 103, 73, 105, 94, 68, 32, 37, 32, 34, 70, 64, 50, 82, 92, 97, 96, 62, 84, 59, 37, 72, 73, 76, 5, 92, 93, 90, 80, 119, 110, 108, 84, 68, 58, 57,
+#> 75, 29, 86, 87, 94, 82, 83, 92, 86, 95, 95, 31, 47, 30, 10, 70, 47, 47, 28, 2, 14, 253, 616, 648, 594, 650, 606, 435, 434, 109, 492, 406, 458, 47, 270, 354, 73, 14, 20, 7, 20, 83, 104, 80, 99, 83, 69, 105, 86, 73, 9, 59, 33, 1, 0, 19, 99, 100, 113, 91, 84, 80, 71, 52, 86, 77, 32, 30, 26, 2, 98, 656, 619, 456, 666, 632, 564, 624, 623, 558, 536, 36, 571, 585, 184, 252, 47, 9, 21, 66, 97, 68, 84, 97, 13, 11, 8, 6, 79, 39, 0, 3, 97, 105, 118, 128, 121, 66, 26, 34, 18, 0, 1, 2, 233, 610, 475, 554, 614,
+#> 587, 604, 539, 510, 516, 481, 336, 528, 12, 373, 316, 337, 2, 15, 447, 366, 477, 423, 478, 395, 448, 423, 530, 454, 480, 372, 348, 268, 242, 134, 24, 567, 543, 524, 550, 570, 524, 489, 480, 540, 499, 523, 543, 200, 60, 67, 378, 510, 411, 526, 554, 517, 482, 527, 533, 457, 165, 344, 390, 99, 37, 151, 11, 89, 87, 91, 78, 67, 90, 83, 97, 90, 108, 85, 104, 77, 49, 56, 29, 10, 54, 67, 78, 98, 109, 118, 96, 54, 71, 68, 47, 63, 64, 3, 3, 555, 617, 602, 528, 615, 589, 534, 113, 199, 407, 32, 329, 2, 41,
+#> 12, 421, 360, 404, 372, 439, 379, 426, 334, 236, 412, 119, 174, 317, 289, 372, 331, 243, 150, 126, 106, 595, 620, 634, 636, 633, 590, 606, 423, 158, 538, 553, 173, 324, 490, 218, 92, 77, 150, 19, 8, 29, 4, 50, 63, 57, 50, 85, 43, 67, 41, 6, 0, 497, 573, 558, 499, 568, 469, 541, 595, 594, 374, 495, 610, 126, 123, 14, 425, 2, 623, 462, 535, 493, 499, 599, 584, 418, 370, 50, 109, 109, 90, 10, 6, 61, 67, 55, 19, 4, 120, 61, 79, 52, 17, 8, 1, 63, 75, 94, 84, 87, 102, 80, 86, 88, 72, 62, 25, 67, 47, 74,
+#> 25, 35, 28, 279, 593, 540, 618, 491, 128, 13, 124, 343, 289, 60, 163, 435, 545, 521, 497, 566, 580, 582, 593, 534, 545, 527, 396, 536, 525, 549, 380, 399, 451, 68, 4, 5, 8, 361, 524, 580, 681, 649, 580, 506, 562, 543, 428, 7, 31, 98, 117, 107, 74, 81, 67, 69, 78, 66, 75, 26, 1, 449, 593, 619, 46, 594, 556, 500, 573, 67, 270, 523, 402, 6, 82, 223, 384, 661, 649, 644, 643, 560, 658, 589, 661, 660, 630, 606, 578, 541, 204, 157, 4, 26, 591, 621, 438, 405, 620, 506, 594, 621, 554, 404, 56, 36, 535, 516,
+#> 517, 220, 628, 634, 519, 350, 268, 256, 489, 496, 208, 13, 1, 413, 323, 599, 454, 539, 572, 339, 269, 281, 228, 86, 377, 550, 565, 483, 583, 396, 577, 194, 57, 637, 621, 599, 462, 508, 541, 610, 503, 534, 594, 272, 525, 415, 7, 73, 113, 87, 79, 7, 67, 84, 15, 21, 30, 52, 23, 21, 53, 11, 73, 72, 26, 67, 87, 67, 79, 71, 48, 20, 22, 39, 7, 14, 24, 345, 585, 649, 589, 437, 537, 438, 577, 599, 535, 569, 175, 168, 255, 189, 308, 265, 136, 26, 297, 489, 612, 452, 525, 526, 574, 294, 516, 566, 592, 543,
+#> 585, 57, 582, 503, 497, 492, 128, 178, 60, 402, 427, 561, 582, 609, 641, 603, 586, 553, 533, 383, 597, 323, 240, 542, 270, 581, 566, 573, 529, 583, 575, 530, 198, 204, 25, 42, 91, 95, 92, 101, 84, 85, 85, 71, 62, 73, 85, 4, 47, 40, 3, 46, 63, 74, 92, 81, 25, 49, 34, 39, 51, 11, 83, 83, 77, 67, 28, 0, 4, 11, 14, 5, 13, 45, 81, 45, 4, 43, 22, 585, 612, 606, 501, 624, 382, 121, 563, 458, 40, 411, 487, 300, 75, 92, 85, 49, 0, 8, 2, 414, 560, 531, 564, 579, 473, 541, 377, 586, 560, 388, 23, 274, 332,
+#> 137, 104, 56, 515, 385, 605, 615, 476, 560, 460, 113, 35, 187, 86, 51, 96, 96, 55, 75, 41, 1, 1, 13, 10, 11, 0, 279, 639, 568, 648, 631, 648, 588, 561, 265, 7, 79, 51, 55, 121, 114, 11, 99, 109, 124, 115, 113, 109, 127, 129, 107, 114, 89, 89, 80, 46, 25, 24, 133, 235, 324, 204, 35, 151, 116, 95, 431, 504, 377, 334, 203, 395, 416, 288, 115, 85, 180, 284, 139, 3, 41, 61, 502, 431, 356, 585, 568, 424, 151, 370, 316, 166, 491, 364, 111, 2, 0, 0, 93, 11, 73, 108, 75, 25, 124, 97, 18, 107, 88, 11, 75,
+#> 44, 15, 15, 88, 86, 19, 62, 42, 29, 7, 15, 2, 6, 23, 83, 36, 20, 76, 75, 95, 73, 57, 78, 52, 16, 1, 16, 83, 640, 630, 618, 603, 564, 472, 581, 580, 504, 212, 40, 180, 182, 413, 350, 417, 332, 387, 368, 489, 450, 376, 398, 309, 295, 373, 368, 238, 110, 2, 97, 152, 69, 292, 448, 520, 524, 459, 408, 76, 102, 87, 87, 101, 103, 76, 59, 69, 26, 17, 72, 31, 24, 47, 3, 592, 489, 549, 568, 470, 519, 149, 226, 225, 141, 458, 567, 616, 588, 538, 543, 376, 562, 550, 541, 368, 535, 547, 582, 566, 477, 563, 544,
+#> 512, 552, 550, 438, 525, 529, 22, 53, 94, 99, 115, 120, 25, 124, 98, 95, 72, 83, 81, 60, 56, 48, 21, 16, 11, 67, 39, 5, 82, 95, 101, 88, 10, 67, 79, 78, 53, 80, 83, 59, 16, 21, 10, 10, 565, 561, 456, 522, 514, 528, 509, 566, 334, 531, 10, 91, 386, 320, 400, 420, 411, 272, 310, 38, 75, 195, 88, 300, 96, 121, 137, 64, 35, 120, 117, 106, 99, 90, 107, 61, 55, 45, 15, 2, 95, 75, 53, 26, 40, 57, 105, 47, 19, 59, 68, 55, 63, 51, 0, 135, 490, 515, 524, 198, 501, 484, 563, 543, 523, 586, 333, 43, 28, 51,
+#> 0, 304, 231, 197, 503, 487, 587, 448, 441, 242, 69, 10, 187, 613, 337, 184, 360, 365, 440, 162, 147, 572, 475, 576, 571, 534, 526, 523, 584, 541, 379, 30, 44, 375, 5, 248, 505, 188, 316, 431, 465, 439, 63, 159, 250, 581, 385, 110, 179, 156, 13, 398, 500, 507, 544, 512, 163, 538, 151, 247, 116, 51, 62, 1, 12, 220, 491, 532, 588, 608, 582, 559, 296, 487, 494, 299, 58, 170, 88, 62, 10, 60, 296, 569, 585, 534, 576, 536, 421, 299, 545, 468, 266, 172, 57, 577, 459, 498, 508, 537, 438, 463, 251, 8, 21,
+#> 61, 41, 71, 97, 91, 84, 114, 30, 42, 42, 78, 15, 29, 11, 78, 55, 48, 43, 392, 534, 517, 526, 567, 476, 528, 608, 54, 465, 204, 58, 120, 378, 602, 530, 475, 509, 565, 512, 529, 524, 353, 198, 525, 382, 645, 454, 549, 606, 110, 241, 10, 34, 7, 78, 28, 2, 26, 13, 0, 18, 36, 80, 109, 77, 60, 13, 16, 7, 79, 41, 28, 4, 1, 3, 0, 7, 71, 58, 93, 8, 11, 5, 64, 22, 19, 29, 11, 560, 292, 225, 536, 480, 423, 388, 127, 221, 78, 140, 44, 3, 3, 7, 66, 103, 112, 77, 65, 77, 5, 72, 48, 15, 3, 4, 395, 604, 516, 425,
+#> 591, 609, 551, 549, 568, 556, 409, 510, 492, 125, 267, 9, 223, 83, 209, 138, 18, 99, 293, 396, 487, 358, 519, 429, 450, 465, 543, 214, 471, 464, 481, 246, 176, 221, 40, 635, 556, 335, 590, 458, 405, 538, 1, 576, 587, 543, 581, 624, 427, 573, 398, 541, 558, 246, 28, 17, 102, 86, 66, 91, 61, 2, 22, 37, 50, 74, 76, 75, 63, 31, 45, 49, 22, 68, 34, 74, 74, 95, 112, 31, 58, 42, 32, 2, 66, 84, 2, 75, 98, 72, 6, 0, 30, 69, 5, 60, 60, 71, 97, 1, 12, 94, 49, 68, 203, 629, 570, 592, 578, 506, 391, 20, 314,
+#> 2, 575, 512, 559, 571, 450, 562, 635, 610, 628, 377, 295, 129, 165, 365, 6, 56, 9, 69, 83, 70, 103, 100, 94, 26, 6, 67, 13, 14, 0, 55, 80, 31, 40, 7, 3, 73, 33, 7, 4, 0, 435, 547, 485, 418, 506, 430, 498, 540, 567, 515, 372, 186, 7, 234, 397, 344, 307, 386, 421, 365, 461, 84, 198, 259, 125, 68, 620, 621, 638, 565, 604, 490, 480, 67, 177, 308, 17, 158, 6, 375, 463, 329, 588, 590, 577, 571, 583, 595, 579, 184, 400, 51, 592, 296, 494, 446, 329, 327, 40, 442, 282, 5, 57, 31, 50, 75, 91, 133, 102, 103,
+#> 68, 69, 14, 63, 52, 44, 9, 0, 14, 34, 73, 25, 21, 2, 62, 71, 60, 68, 64, 41, 7, 633, 276, 396, 368, 322, 126, 2, 2, 47, 467, 617, 568, 624, 587, 611, 612, 555, 578, 578, 593, 591, 562, 594, 502, 472, 341, 331, 372, 433, 337, 2, 12, 55, 73, 92, 87, 105, 112, 64, 50, 40, 42, 16, 19, 200, 438, 449, 397, 18, 280, 515, 290, 307, 147, 337, 47, 342, 349, 137, 158, 15, 111, 68, 78, 493, 540, 14, 4, 356, 528, 496, 580, 342, 452, 25, 19, 274, 643, 632, 487, 571, 515, 157, 2, 326, 88, 0, 1, 40, 60, 52, 65,
+#> 120, 109, 103, 96, 92, 91, 74, 29, 46, 8, 13, 0, 129, 551, 527, 560, 581, 538, 541, 486, 555, 540, 482, 531, 480, 272, 208, 160, 282, 478, 601, 537, 259, 4, 21, 498, 597, 473, 1, 540, 248, 169, 343, 5, 37, 2, 9, 105, 79, 55, 53, 15, 72, 61, 13, 147, 509, 525, 595, 500, 545, 604, 468, 583, 561, 527, 541, 586, 402, 10, 328, 17, 13, 70, 20, 593, 454, 225, 154, 556, 531, 393, 540, 535, 607, 576, 529, 408, 181, 81, 155, 540, 459, 583, 573, 565, 323, 41, 443, 575, 597, 485, 528, 360, 565, 575, 555, 310,
+#> 126, 307, 104, 19, 103, 130, 402, 8, 87, 75, 4, 257, 313, 300, 234, 139, 120, 115, 99, 37, 1, 0, 6, 15, 2, 73, 91, 56, 22, 41, 24, 38, 27, 30, 2, 41, 79, 54, 27, 2, 5, 68, 74, 55, 84, 39, 3, 9, 67, 179, 61, 257, 501, 77, 109, 241, 488, 571, 13, 523, 328, 464, 21, 589, 458, 329, 268, 55, 193, 346, 482, 530, 614, 498, 510, 459, 334, 360, 256, 206, 63, 21, 158, 4, 9, 366, 522, 555, 511, 519, 513, 220, 14, 58, 469, 534, 234, 513, 548, 519, 514, 277, 178, 551, 516, 510, 252, 93, 220, 164, 142, 0, 42,
+#> 68, 57, 83, 83, 82, 77, 58, 55, 29, 39, 70, 74, 90, 41, 50, 72, 56, 36, 61, 7, 0, 6, 8, 558, 629, 631, 636, 568, 618, 585, 380, 322, 29, 36, 3, 7, 1, 0, 81, 75, 9, 89, 17, 72, 39, 5, 8, 50, 90, 101, 74, 45, 59, 4, 4, 77, 473, 183, 264, 606, 3, 310, 141, 172, 14, 471, 607, 501, 202, 535, 370, 276, 19, 531, 621, 553, 587, 600, 558, 584, 90, 327, 546, 569, 608, 597, 538, 403, 270, 355, 91, 8, 5, 514, 567, 434, 87, 588, 368, 522, 641, 598, 276, 152, 460, 93, 233, 429, 345, 80, 310, 1, 160, 330, 252,
+#> 326, 331, 283, 74, 82, 1, 225, 627, 579, 506, 539, 584, 345, 515, 538, 560, 475, 260, 273, 2, 28, 31, 43, 87, 65, 68, 82, 84, 36, 1, 68, 31, 3, 47, 15, 8, 1, 510, 261, 25, 555, 483, 559, 247, 506, 527, 515, 83, 30, 26, 418, 337, 266, 307, 234, 172, 241, 279, 259, 172, 229, 81, 81, 19, 540, 541, 589, 610, 595, 532, 592, 578, 556, 564, 630, 490, 329, 96, 12, 27, 94, 107, 115, 97, 102, 52, 14, 71, 68, 17, 8, 2, 312, 595, 564, 542, 476, 566, 617, 531, 616, 559, 524, 554, 553, 572, 330, 147, 418, 584,
+#> 622, 534, 513, 648, 605, 588, 639, 486, 3, 134, 602, 617, 594, 495, 554, 449, 516, 483, 484, 517, 302, 22, 293, 469, 415, 597, 547, 534, 503, 584, 541, 521, 482, 433, 472, 359, 395, 232, 147, 9, 2, 67, 57, 85, 63, 89, 83, 78, 81, 76, 85, 41, 50, 206, 471, 347, 293, 538, 483, 565, 550, 588, 411, 151, 292, 471, 286, 148, 142, 36, 141, 94, 3, 57, 5, 1, 56, 106, 48, 19, 89, 82, 32, 5, 5, 0, 502, 565, 555, 549, 547, 531, 516, 414, 148, 557, 321, 6, 40, 18, 97, 74, 62, 34, 63, 19, 0, 34, 13, 4, 0, 6, 43,
+#> 98, 90, 111, 106, 116, 112, 105, 101, 81, 105, 94, 108, 104, 95, 94, 98, 90, 59, 35, 21, 401, 510, 587, 537, 499, 298, 469, 66, 397, 357, 71, 41, 590, 574, 593, 518, 548, 510, 484, 386, 317, 357, 461, 520, 525, 522, 425, 538, 446, 235, 118, 140, 33, 162, 143, 341, 379, 359, 308, 280, 291, 53, 446, 403, 268, 137, 101, 4, 5, 89, 56, 119, 108, 136, 102, 124, 112, 98, 78, 93, 46, 13, 4, 40, 81, 83, 86, 85, 69, 63, 64, 33, 0, 114, 138, 180, 87, 238, 251, 371, 397, 411, 376, 105, 135, 377, 225, 63, 7,
+#> 26, 70, 68, 84, 70, 67, 18, 6, 8, 0, 5, 0, 34, 60, 54, 9, 1, 13, 543, 529, 587, 646, 589, 647, 644, 475, 206, 413, 583, 464, 64, 477, 141, 198, 32, 36, 43, 46, 24, 40, 8, 0, 7, 68, 445, 291, 355, 484, 561, 138, 388, 485, 200, 166, 86, 411, 282, 18, 80, 114, 98, 81, 84, 94, 34, 19, 46, 333, 391, 608, 559, 501, 285, 130, 440, 94, 295, 257, 481, 515, 43, 247, 443, 317, 6, 105, 5, 44, 2, 77, 481, 596, 561, 582, 508, 520, 579, 546, 550, 579, 475, 413, 197, 215, 127, 22, 31, 19, 474, 450, 437, 521, 489,
+#> 481, 550, 522, 464, 363, 144, 47, 279, 436, 437, 505, 468, 519, 397, 446, 388, 330, 96, 97, 103, 47, 117, 111, 74, 60, 12, 105, 36, 20, 471, 370, 89, 30, 285, 514, 509, 550, 572, 550, 385, 444, 492, 477, 450, 120, 58, 21, 19, 62, 62, 92, 71, 34, 32, 29, 27, 12, 2, 2, 0, 515, 553, 471, 549, 464, 614, 617, 540, 578, 413, 307, 143, 52, 447, 522, 362, 42, 10, 300, 96, 183, 157, 41, 559, 360, 132, 459, 606, 320, 453, 361, 223, 52, 162, 151, 39, 179, 27, 5, 2, 40, 56, 78, 93, 69, 34, 19, 65, 38, 12, 2,
+#> 0, 34, 2, 3, 17, 37, 19, 14, 50, 3, 13, 8, 2, 0, 335, 437, 364, 549, 620, 667, 425, 479, 547, 523, 523, 395, 411, 93, 10, 83, 160, 552, 620, 606, 534, 590, 584, 538, 542, 508, 327, 370, 235, 233, 158, 354, 167, 86, 95, 97, 96, 96, 45, 60, 14, 11, 77, 41, 7, 7, 446, 662, 637, 589, 596, 609, 596, 405, 401, 502, 133, 67, 64, 0, 582, 572, 608, 1, 32, 439, 547, 503, 447, 519, 513, 577, 491, 504, 416, 247, 58, 55, 402, 555, 541, 394, 533, 438, 539, 503, 434, 337, 464, 127, 565, 580, 578, 585, 600, 575,
+#> 595, 572, 621, 596, 578, 558, 552, 486, 498, 403, 478, 417, 195, 49, 209, 30, 66, 112, 69, 48, 63, 5, 40, 70, 0, 29, 8, 7, 16, 1, 53, 75, 15, 40, 51, 70, 91, 89, 57, 57, 21, 37, 66, 72, 96, 38, 3, 41, 22, 56, 35, 23, 10, 16, 8, 13, 7, 0, 5, 0, 33, 20, 116, 530, 357, 152, 540, 525, 567, 395, 520, 261, 151, 378, 236, 15, 2, 75, 81, 46, 19, 30, 1, 8, 36, 17, 0, 3, 30, 10, 0, 341, 549, 461, 543, 517, 533, 474, 519, 541, 527, 514, 377, 172, 465, 361, 333, 440, 435, 44, 67, 102, 87, 112, 123, 122, 107,
+#> 100, 80, 99, 89, 79, 33, 52, 79, 68, 35, 21, 10, 16, 45, 540, 486, 437, 211, 6, 36, 58, 363, 587, 70, 458, 265, 145, 498, 242, 317, 374, 6, 9, 5, 44, 554, 573, 567, 599, 466, 492, 416, 80, 679, 656, 620, 591, 624, 561, 561, 474, 471, 487, 417, 351, 120, 59, 3, 159, 605, 607, 538, 594, 617, 555, 553, 557, 439, 588, 525, 334, 372, 235, 565, 606, 659, 408, 640, 642, 553, 620, 564, 610, 553, 334, 153, 394, 254, 427, 3, 226, 120, 143, 5, 24, 19, 3, 0, 46, 79, 98, 88, 63, 43, 29, 0, 20, 1, 0, 3, 176, 163,
+#> 164, 187, 244, 190, 48, 70, 25, 16, 9, 32, 1, 32, 1, 0, 1, 2, 635, 593, 540, 516, 290, 543, 469, 463, 244, 343, 118, 89, 10, 379, 531, 538, 607, 497, 570, 573, 612, 517, 127, 301, 101, 122, 181, 263, 14, 201, 542, 597, 559, 555, 537, 513, 463, 375, 47, 45, 172, 0, 25, 16, 62, 98, 82, 89, 72, 84, 101, 34, 15, 1, 9, 21, 0, NA, 0, 0, 0, 0, 1, 36, 60, 60, 72, 71, 65, 66, 69, 88, 64, 0, 45, 30, 0, 20, 16, 84, 87, 11, 11, 52, 30, 6, 0, 534, 509, 71, 561, 604, 519, 409, 599, 663, 554, 473, 481, 3, 3, 13,
+#> 247, 457, 604, 648, 624, 631, 636, 649, 619, 623, 624, 605, 606, 621, 539, 442, 41, 528, 579, 476, 499, 552, 572, 546, 594, 548, 572, 536, 547, 502, 546, 452, 108, 328, 52, 28, 504, 588, 617, 577, 543, 511, 551, 586, 398, 551, 525, 399, 479, 458, 327, 456, 467, 405, 278, 310, 558, 36, 75, 62, 86, 78, 42, 73, 65, 53, 96, 85, 92, 67, 82, 18, 13, 35, 593, 596, 538, 594, 617, 589, 597, 511, 610, 432, 591, 612, 511, 573, 552, 565, 222, 83, 81, 88, 41, 79, 56, 49, 47, 29, 25, 20, 25, 11, 31, 1, 11, 2,
+#> 0, 533, 575, 557, 612, 600, 625, 581, 601, 578, 564, 659, 546, 622, 599, 552, 491, 436, 499, 572, 611, 554, 540, 464, 545, 609, 482, 568, 582, 576, 479, 421, 539, 471, 455, 342, 534, 427, 50, 118, 67, 530, 595, 544, 570, 563, 552, 589, 611, 617, 628, 535, 496, 180, 166, 24, 221, 34, 468, 602, 609, 615, 601, 629, 590, 603, 592, 631, 570, 570, 603, 600, 606, 547, 516, 495, 449, 392, 340, 465, 271, 2, 17, 51, 77, 79, 91, 87, 57, 70, 102, 99, 83, 68, 67, 56, 56, 31, 9, 0, 1, 35, 53, 79, 86, 86, 88, 99,
+#> 104, 91, 103, 51, 26, 31, 43, 1, 6, 20, 8, 0, 20, 103, 634, 627, 604, 595, 590, 619, 580, 537, 364, 155, 62, 32, 38, 284, 396, 310, 375, 334, 316, 426, 450, 351, 421, 505, 421, 337, 220, 73, 16, 516, 14, 569, 556, 568, 517, 545, 568, 556, 570, 591, 540, 97, 315, 31, 8, 2, 199, 540, 557, 588, 470, 479, 448, 393, 246, 399, 505, 468, 320, 13, 379, 528, 220, 431, 559, 512, 568, 617, 169, 557, 415, 339, 3, 89, 59, 72, 74, 74, 98, 94, 30, 7, 25, 22, 15, 3, 15, 18, 94, 75, 89, 81, 100, 95, 84, 99, 103,
+#> 106, 104, 51, 18, 47, 71, 25, 279, 290, 356, 376, 443, 323, 446, 494, 487, 550, 391, 410, 116, 199, 203, 2, 18, 81, 82, 46, 57, 88, 46, 55, 21, 12, 14, 25, 462, 596, 530, 467, 385, 205, 595, 580, 563, 611, 541, 221, 45, 48, 197, 368, 366, 576, 610, 459, 536, 585, 406, 542, 352, 535, 227, 7, 161, 585, 474, 515, 601, 609, 417, 317, 486, 484, 471, 52, 124, 94, 255, 112, 123, 3, 162, 460, 380, 520, 560, 600, 556, 478, 297, 336, 44, 58, 30, 255, 526, 567, 493, 538, 558, 572, 534, 601, 494, 621, 639, 506,
+#> 227, 367, 193, 64, 228, 255, 382, 463, 440, 311, 383, 427, 518, 537, 30, 350, 259, 195, 140, 108, 14, 97, 93, 73, 93, 9, 68, 61, 83, 67, 56, 52, 11, 19, 2, 70, 168, 19, 570, 552, 580, 574, 578, 544, 548, 535, 498, 530, 138, 80, 82, 427, 614, 578, 265, 360, 3, 603, 605, 569, 585, 625, 579, 529, 34, 49, 452, 563, 600, 573, 567, 250, 84, 3, 550, 107, 148, 21, 455, 577, 510, 588, 594, 562, 374, 479, 50, 423, 571, 420, 197, 143, 58, 33, 77, 5, 44, 52, 52, 51, 61, 97, 87, 94, 73, 88, 79, 91, 86, 71, 71,
+#> 11, 29, 0, 32, 37, 13, 17, 9, 14, 10, 10, 1, 5, 0, 6, 15, 69, 98, 92, 47, 120, 106, 70, 77, 108, 99, 91, 93, 84, 101, 86, 75, 90, 75, 37, 54, 11, 136, 448, 473, 616, 477, 341, 508, 64, 253, 351, 42, 52, 429, 511, 516, 505, 451, 523, 243, 164, 89, 19, 35, 570, 501, 556, 519, 527, 492, 438, 168, 496, 469, 189, 72, 192, 260, 328, 229, 564, 364, 540, 502, 456, 523, 491, 495, 329, 263, 383, 344, 413, 24, 202, 478, 351, 353, 113, 2, 10, 77, 57, 63, 90, 85, 80, 36, 21, 1, 0, 41, 32, 52, 63, 57, 63, 62,
+#> 96, 94, 19, 45, 23, 61, 82, 66, 27, 22, 44, 117, 463, 313, 595, 668, 634, 589, 612, 559, 620, 610, 608, 598, 608, 589, 556, 549, 553, 482, 218, 47, 7, 4, 115, 168, 64, 466, 460, 522, 508, 405, 394, 364, 109, 274, 523, 515, 494, 534, 534, 396, 298, 364, 158, 7, 48, 143, 358, 182, 401, 433, 499, 590, 590, 312, 513, 155, 348, 410, 310, 508, 29, 517, 554, 591, 614, 658, 631, 543, 577, 308, 385, 57, 384, 521, 520, 501, 584, 593, 573, 596, 678, 631, 636, 587, 584, 26, 70, 19, 4, 530, 533, 196, 482, 575,
+#> 587, 74, 498, 87, 275, 185, 91, 145, 30, 29, 21, 448, 267, 493, 417, 433, 516, 493, 519, 598, 592, 566, 549, 33, 287, 227, 215, 288, 464, 457, 465, 282, 538, 561, 478, 237, 273, 262, 559, 337, 123, 8, 61, 68, 62, 72, 89, 35, 21, 4, 19, 10, 41, 11, 29, 30, 5, 18, 44, 29, 19, 15, 32, 16, 3, 6, 5, 32, 74, 30, 29, 26, 17, 21, 22, 16, 8, 22, 11, 13, 2, 8, 24, 9, 7, 2, NA, 0, 64, 70, 66, 10, 14, 3, 5, 26, 7, 305, 182, 469, 460, 662, 692, 630, 679, 664, 610, 0, 82, 103, 73, 88, 80, 93, 108, 24, 35, 7, 3,
+#> 17, 2, 19, 69, 384, 397, 287, 394, 389, 470, 414, 437, 445, 334, 380, 361, 86, 474, 543, 451, 519, 432, 570, 572, 538, 600, 622, 589, 638, 585, 502, 507, 412, 522, 378, 96, 648, 652, 607, 619, 652, 625, 669, 618, 650, 499, 495, 574, 566, 484, 466, 406, 319, 242, 516, 613, 695, 527, 630, 650, 594, 616, 627, 434, 189, 522, 601, 132, 61, 66, 50, 19, 15, 13, 10, 0, 33, 47, 529, 618, 612, 645, 645, 648, 634, 642, 642, 636, 594, 574, 576, 404, 520, 351, 8, 104, 353, 535, 507, 493, 479, 467, 603, 488, 411,
+#> 483, 370, 452, 440, 363, 149, 9, 322, 461, 489, 588, 555, 583, 601, 597, 588, 592, 533, 190, 191, 113, 91, 56, 219, 371, 312, 345, 421, 21, 229, 205, 251, 377, 337, 323, 360, 264, 5, 171, 77, 67, 60, 3, 0, 3, 0, 32, 35, 45, 89, 90, 50, 53, 49, 8, 26, 56, 4, 32, 2, 5, 25, 4, 0, 25, 43, 13, 25, 1, 35, 50, 45, 25, 20, 16, 16, 9, 16, 19, 11, 0, 221, 129, 98, 453, 612, 550, 641, 517, 549, 433, 162, 49, 12, 6, 42, 4, 71, 17, 41, 49, 66, 106, 87, 35, 49, 14, 6, 0, 26, 73, 66, 91, 83, 83, 111, 96, 110, 130,
+#> 106, 93, 79, 22, 1, 14, 63, 100, 61, 83, 93, 118, 99, 77, 87, 76, 93, 45, NA, 0, 1, NA, 79, 53, 48, NA, 1, NA, 35, 8, 12, 4, 28, 661, 566, 434, 469, 363, 436, 485, 460, 297, 271, 305, 295, 272, 303, 37, 8, 622, 520, 533, 602, 537, 448, 507, 331, 143, 6, 3, 3, 1, 76, 90, 83, 80, 61, 23, 56, 89, 69, 48, 6, 1, 352, 460, 665, 556, 592, 60, 313, 577, 456, 79, 454, 42, 213, 200, 219, 82, 26, 552, 626, 460, 219, 19, 26, 19, 0, 45, 81, 66, 83, 80, 107, 41, 58, 35, 4, 31, 29, 37, 27, 2, 9, 4, 0, 2, 4, 30,
+#> 26, 26, 16, 7, 13, 17, 11, 12, 8, 4, 1, 11, 6, 0, 4, 2, 12, 17, 26, 49, 54, 57, 77, 69, 110, 74, 113, 118, 583, 646, 570, 567, 494, 594, 579, 539, 603, 566, 508, 455, 540, 515, 543, 546, 558, 523, 518, 364, 338, 459, 380, 59, 45, 510, 568, 621, 659, 666, 543, 581, 403, 217, 75, 194, 145, 452, 495, 423, 371, 282, 209, 230, 496, 458, 317, 332, 250, 117, 1, 3, 422, 208, 396, 335, 635, 662, 679, 617, 626, 514, 618, 606, 35, 14, 311, 418, 283, 394, 89, 363, 71, 370, 501, 340, 18, 0, 0, 3, 0, 81, 120,
+#> 72, 81, 99, 72, 71, 82, 96, 30, 623, 516, 670, 654, 585, 626, 627, 649, 632, 645, 680, 652, 662, 665, 655, 655, 628, 655, 431, 634, 493, 96, 278, 405, 237, 138, 580, 613, 531, 585, 501, 380, 513, 213, 279, 427, 214, 11, 112, 31, 59, 89, 112, 97, 98, 112, 79, 123, 109, 85, 105, 51, 69, NA, 2, 64, 104, 288, 455, 603, 626, 654, 619, 612, 556, 398, 495, 477, 290, 275, 136, 26, 28, 66, 76, 87, 96, 104, 100, 60, 94, 118, 109, 87, 103, 65, 81, 28, 5, 65, 80, 89, 75, 76, 92, 93, 24, 42, 0, 21, 370, 577,
+#> 505, 344, 359, 339, 180, 71, 98, 183, 295, 368, 64, 83, 23, 48, 77, 27, 6, 347, 578, 604, 630, 592, 608, 561, 586, 577, 575, 555, 555, 464, 536, 375, 76, 264, 381, 226, 217, 299, 184, 23, 417, 41, 27, 9, 7, 672, 576, 622, 557, 470, 637, 628, 487, 28, 571, 459, 455, 123, 24, 632, 619, 524, 463, 521, 438, 459, 549, 506, 250, 462, 416, 298, 171, 254, 397, 438, 532, 394, 612, 603, 538, 91, 87, 51, 13, 80, 99, 31, 31, 546, 442, 541, 552, 515, 577, 401, 569, 547, 295, 555, 527, 500, 433, 248, 333, 312,
+#> 27, 175, 592, 505, 602, 611, 590, 614, 580, 601, 347, 340, 124, 157, 230, 191, 133, 56, 28, 20, 533, 475, 196, 479, 388, 529, 478, 367, 520, 443, 401, 403, 23, 2, 406, 220, 501, 601, 523, 546, 477, 424, 602, 624, 634, 544, 519, 529, 361, 310, 51, 15, 67, 31, 12, 27, 10, 29, 67, 3, 2, 0, 1, 10, 300, 520, 431, 492, 517, 540, 489, 395, 516, 374, 380, 445, 427, 237, 142, 198, 589, 565, 597, 557, 568, 379, 452, 578, 588, 554, 551, 195, 92, 102, 462, 419, 554, 451, 542, 269, 36, 101, 11, 102, 544, 544,
+#> 494, 286, 275, 314, 388, 169, 158, 346, 293, 468, 502, 257, 171, 74, 15, 497, 510, 522, 356, 401, 126, 111, 24, 10, 212, 47, 32, 66, 55, 57, 88, 53, 69, 22, 60, 97, 78, 28, 31, 16, 17, 9, 2, 3, 8, 37, 99, 80, 82, 91, 101, 85, 94, 80, NA, 0, 4, 283, 19, 19, 477, 616, 505, 361, 342, 475, 574, 582, 230, 464, 36, 25, 152, 174, 10, 555, 38, 31, 304, 421, 533, 485, 462, 435, 522, 474, 511, 495, 522, 508, 461, 428, 186, 390, 424, 202, 60, 73, 8, 5, 7, 46, 36, 18, 29, 13, 2, 5, 12, 13, 11, 16, 17, 7, NA,
+#> 1, 26, 11, 24, 1, 5, 6, 18, 8, 4, 17, 17, 8, 0, 14, 3, 13, 6, 486, 465, 590, 511, 494, 71, 345, 402, 161, 97, 14, 27, 12, 19, 629, 529, 368, 565, 636, 425, 422, 204, 62, 51, 209, 500, 579, 550, 474, 285, 426, 348, 347, 158, 1, 42, 542, 497, 507, 480, 575, 547, 518, 543, 452, 135, 87, 59, 12, 13, 400, 491, 424, 472, 491, 415, 550, 533, 526, 418, 465, 370, 344, 435, 293, 41, 13, 429, 528, 322, 379, 328, 311, 136, 236, 104, 8, 23, 69, 72, 73, 79, 32, 64, 108, 88, 76, 31, 17, 182, 247, 322, 415, 561,
+#> 565, 415, 555, 666, 574, 662, 476, 575, 461, 8, 324, 48, 280, 3, 3, 8, 21, 8, 7, 9, 1, 16, 3, 6, 0, 7, 1, 2, 17, 40, 63, 63, 41, 12, 21, 10, 20, 1, 15, 9, 8, 1, 0, 25, 281, 257, 600, 625, 629, 587, 609, 515, 564, 596, 511, 527, 559, 544, 489, 585, 306, 196, 253, 137, 183, 200, 11, 434, 547, 215, 419, 631, 643, 689, 660, 655, 664, 640, 621, 650, 635, 528, 498, 489, 298, 405, 59, 54, 99, 39, 41, 9, 53, 69, 59, 94, 44, 67, 48, 34, 1, 1, 22, 54, 66, 88, 80, 28, 46, 6, 41, 66, 84, 58, 66, 5, 25, 2, 601,
+#> 565, 350, 549, 480, 537, 578, 604, 604, 617, 606, 584, 412, 156, 146, 44, 1, 364, 303, 552, 421, 625, 480, 516, 477, 500, 552, 440, 375, 164, 125, 140, 5, 2, 214, 542, 475, 413, 468, 471, 614, 533, 427, 1, 15, 526, 539, 553, 522, 250, 21, 357, 368, 88, 180, 18, 4, 514, 461, 458, 191, 577, 535, 580, 599, 535, 605, 616, 564, 409, 540, 364, 523, 472, 329, 443, 77, 95, 91, 95, 92, 89, 93, 71, 95, 82, 55, 31, 74, 76, 46, 55, 34, 64, 0, 0, NA, NA, 24, 10, 67, 405, 465, 409, 543, 471, 434, 515, 164, 474,
+#> 239, 152, 331, 28, 106, 21, 59, 155, 169, 146, 137, 5, 250, 219, 564, 418, 594, 542, 495, 554, 404, 542, 481, 535, 412, 449, 117, 77, 1, 51, 0, 93, 100, 108, 113, 115, 109, 84, 2, NA, NA, NA, 0, 0, NA, NA, 67, 53, 14, 17, 10, 36, 64, 86, 64, 61, 70, 91, 82, 115, 89, NA, NA, NA, 54, 3, 6, 5, 37, 74, 93, 85, 111, 106, 31, 58, 12, 4, 26, 565, 558, 543, 580, 618, 467, 423, 517, 477, 225, 170, 488, 447, 234, 311, 35, 349, 11, 117, 235, 333, 583, 592, 568, 401, 435, 602, 394, 164, 214, 222, 151, 614, 656,
+#> 597, 643, 543, 591, 530, 474, 372, 172, 16, 86, 564, 532, 605, 562, 538, 557, 621, 530, 465, 494, 393, 464, 360, 178, 399, 310, 189, 51, 26, 89, 394, 476, 459, 372, 399, 356, 36, 276, 19, 217, 52, 22, 10, 7, 81, 60, 74, 79, 92, 0, NA, 0, 1, 0, 42, NA, 11, 14, 9, 9, NA, 0, 226, 139, 483, 210, 250, 80, 174, 79, 535, 46, 519, 39, 161, 43, 80, 512, 526, 401, 512, 508, 371, 450, 333, 411, 238, 615, 401, 4, 519, 169, 102, 122, 646, 335, 3, 38, 51, 65, 77, 38, 86, 94, 105, 74, 79, NA, NA, 21, 12, 309, 533,
+#> 580, 655, 664, 631, 617, 577, 577, 599, 601, 502, 119, 134, 431, 110, 3, 3, 12, 1, 5, 6, 16, 22, 15, 18, 96, 125, NA, 0, 0, NA, NA, NA, 12, 210, 328, 135, 187, 53, 274, 247, 121, 11, 1, 18, 12, 71, 93, 57, 103, 112, 107, 87, NA, NA, NA, NA, NA, 47, 501, 510, 504, 511, 530, 510, 376, 559, 454, 1, 156, 49, 89, 3, 19, 184, 472, 530, 459, 500, 285, 470, 493, 442, 522, 402, 348, 198, 268, 139, 50, 91, 136, 570, 652, 590, 577, 498, 638, 518, 676, 531, 314, 79, 129, 0, 114, 393, 504, 566, 557, 510, 514,
+#> 500, 572, 273, 496, 475, 98, 1, 5, 493, 542, 448, 574, 513, 518, 199, 327, 339, 472, 461, 321, 159, 261, 148, 86, 590, 340, 478, 439, 521, 504, 562, 266, 519, 351, 88, 330, 23, 118, 553, 549, 426, 567, 499, 539, 506, 593, 498, 525, 511, 465, 514, 334, 530, 397, 525, 460, 419, 336, 4, 323, 522, 491, 406, 535, 583, 553, 521, 356, 454, 402, 240, 2, 15, 72, 73, 80, 80, 96, 117, 100, 102, 90, 92, 97, 86, 94, 101, 67, 101, 97, 84, 28, NA, 34, 11, NA, NA, NA, 3, 200, 195, 76, 250, 324, 535, 550, 558, 698,
+#> 677, 609, 121, 404, 497, 11, 81, 15, 74, 495, 411, 509, 483, 506, 505, 375, 339, 461, 50, 40, 12, 14, 24, 19, 19, 8, 10, 7, 24, 24, 2, 3, 1, 0, 0, 5, 21, 10, 7, 10, NA, 3, NA, 9, 3, 35, 222, 563, 457, 612, 571, 478, 584, 129, 202, 396, 263, 136, 50, 91, 73, 60, 2, 51, 13, 53, 59, 42, 42, 93, 97, 92, 71, NA, NA, NA, 0, 68, 386, 511, 510, 212, 87, 352, 352, 403, 518, 470, 150, 295, 259, 63, 171, 101, 16, 0, 116, 450, 486, 457, 492, 204, 136, 276, 238, 34, 52, 6, 5, 32, 472, 443, 485, 504, 297, 463,
+#> 298, 409, 415, 267, 40, 162, 333, 569, 576, 484, 553, 574, 533, 448, 471, 170, 313, 404, 521, 558, 349, 506, 560, 266, 57, 86, 453, 451, 511, 519, 517, 597, 616, 595, 617, 382, 7, 93, 77, 52, 94, 89, 94, 45, 2, 26, 19, 56, 95, 60, 82, 85, 92, 105, 73, 59, NA, 12, NA, 8, 22, 39, 74, 71, 77, 83, 29, 2, NA, NA, NA, 69, 93, 265, 278, 637, 589, 604, 457, 357, 506, 272, 16, 74, 21, 10, 15, 102, 45, 1, 0, NA, NA, 1, 79, 83, 68, 35, NA, NA, 30, 43, 59, 93, 620, 555, 540, 583, 552, 470, 592, 478, 486, 577,
+#> 394, 372, 475, 356, 97, 307, 622, 663, 619, 626, 643, 567, 529, 378, 592, 90, 475, 538, 231, 163, 88, 339, 600, 515, 613, 558, 624, 569, 643, 498, 593, 641, 615, 599, 611, 350, 169, 493, 56, 37, 99, 540, 402, 395, 564, 547, 418, 356, 331, 73, 359, 269, 103, 71, 180, 415, 466, 572, 67, 400, 562, 641, 600, 625, 554, 602, 404, 534, 447, 389, 170, 122, 1, 19, 497, 565, 459, 413, 383, 184, 190, 348, 86, 77, 340, 521, 626, 528, 621, 391, 384, 47, 414, 487, 551, 542, 406, 132, 156, 37, 69, 564, 581, 529,
+#> 585, 616, 606, 526, 533, 554, 499, 190, 264, 297, 117, 141, 22, 64, 190, 338, 491, 301, 321, 208, 188, 140, 126, 108, 76, 4, 26, 73, 13, 64, 113, 102, 98, NA, NA, NA, NA, NA, NA, NA, 0, NA, NA, NA, NA, 4, 75, 438, 559, 607, 605, 553, 592, 545, 556, 580, 530, 585, 556, 456, 222, 55, 91, 96, 459, 486, 533, 520, 589, 596, 481, 389, 571, 220, 74, 48, 0, 6, 8, 0, 13, 14, 7, NA, NA, NA, NA, 2, NA, 2, 24, 7, 35, 74, 84, 82, 25, 16, 17, 10, 13, 9, 10, 4, 2, 0, 25, 37, 601, 425, 494, 20, 535, 548, 583, 552,
+#> 576, 512, 498, 472, 521, 441, 436, 461, 308, 463, 404, 365, 38, 105, 179, 227, 510, 484, 498, 417, 437, 401, 463, 316, 129, 124, 62, 13, 18, 56, 64, 86, 91, 97, 117, 120, 98, 110, NA, NA, 0, NA, NA, NA, 87, 71, NA, NA, 48, NA, NA, 0, 55, 483, 470, 396, 312, 287, 127, 6, 5, 48, 457, 508, 187, 263, 487, 536, 571, 320, 478, 338, 476, 488, 359, 543, 457, 454, 253, 375, 452, 460, 188, 53, 11, 133, 514, 447, 444, 582, 320, 193, 576, 625, 527, 516, 515, 502, 63, 75, 2, 355, 611, 559, 525, 610, 500, 575,
+#> 530, 192, 470, 499, 306, 492, 332, 380, 220, 76, 78, 547, 650, 579, 446, 669, 583, 624, 624, 654, 539, 540, 360, 499, 499, 391, 195, 19, 11, 78, 65, 79, 70, 88, 50, NA, NA, NA, NA, NA, NA, 43, 181, 122, 350, 513, 593, 437, 593, 468, 500, 242, 497, 330, 372, 122, 193, 1, 66, 55, 199, 49, 450, 229, 54, 26, 83, 6, 601, 562, 542, 501, 487, 495, 531, 17, 501, 344, 388, 307, 530, 261, 33, 40, 118, 218, 155, 317, 171, 37, 8, 8, 17, 13, 3, 21, NA, 1, NA, 0, 0, NA, 0, 0, NA, 5, NA, 2, 2, 5, 30, 16, 5, 24,
+#> 29, 14, 10, 11, 14, 18, 19, NA, NA, 11, 0, 269, 578, 573, 601, 642, 547, 603, 569, 625, 601, 527, 509, 536, 552, 269, 239, 9, 210, 82, 143, 95, 30, 460, 581, 582, 524, 518, 181, 487, 534, 498, 352, 506, 387, 363, 479, 313, 14, 87, 118, 372, 413, 287, 445, 343, 20, 203, 97, 157, 321, 122, 114, 48, 24, 26, 98, 112, 2, 562, 641, 580, 572, 450, 481, 269, 123, 235, 259, 27, 0, 0, 15, 37, 21, 23, 4, NA, NA, NA, 1, NA, NA, NA, NA, 11, 356, 270, 349, 450, 518, 114, 569, 645, 392, 562, 378, 344, 95, 62, 540,
+#> 561, 425, 587, 555, 474, 631, 571, 359, 616, 446, 491, 298, 370, 42, 119, 9, 4, 148, 137, 503, 510, 427, 554, 594, 543, 515, 464, 501, 290, 215, 33, 24, 130, 605, 609, 502, 538, 535, 592, 498, 562, 550, 580, 540, 476, 254, 65, 0, 73, 35, 80, 100, 105, 69, 90, 0, 0, 2, NA, NA, NA, 10, NA, 43, 26, 44, 260, 418, 595, 571, 567, 139, 257, 461, 547, 562, 556, 357, 465, 523, 401, 505, 507, 499, 437, 276, 1, 16, 27, 50, 70, 95, 31, 1, 212, 278, 211, 434, 615, 553, 252, 554, 634, 625, 627, 466, 262, 497,
+#> 451, 262, 169, 216, 9, 27, 0, 11, 16, 22, 33, 34, 15, 6, 5, 1, NA, 0, 0, 0, 0, 3, 93, 225, 294, 349, 642, 659, 631, 646, 639, 648, 658, 431, 625, 388, 617, 654, 557, 76, 37, 435, 474, 507, 349, 202, 483, 384, 475, 42, 332, 287, 40, 59, 92, 82, 85, 90, 103, 105, 1, 0, NA, 1, NA, NA, NA, 8, 37, 82, 255, 324, 474, 501, 486, 492, 296, 356, 145, 118, 119, 87, 20, 77, 70, 93, 53, 89, 96, 108, 67, 34, NA, 22, 265, 327, 378, 328, 594, 507, 576, 572, 565, 590, 622, 421, 572, 528, 531, 560, 311, 279, 197,
+#> 302, 57, 573, 347, 264, 355, 124, 196, 12, 181, 65, 526, 554, 585, 604, 579, 488, 397, 278, 319, 285, 401, 71, 191, 415, 519, 541, 525, 494, 338, 125, 589, 322, 591, 469, 352, 284, 63, 559, 413, 272, 280, 122, 472, 582, 554, 221, 85, 230, 34, 367, 568, 562, 584, 544, 513, 541, 548, 354, 514, 534, 528, 549, 552, 522, 390, 148, 19, 75, 38, 64, 80, 62, 44, NA, NA, 15, 37, 333, 536, 504, 581, 531, 511, 503, 448, 357, 503, 285, 5, 19, 1, 0, NA, NA, 26, 8, 0, 0, 2, 2, 8, 3, 4, 0, 0, 25, 39, 33, 19, 1,
+#> 0, 1, 0, 20, 12, 12, 18, 0, 0, NA, NA, 77, 453, 514, 514, 533, 447, 311, 249, 494, 279, 568, 473, 403, 114, 399, 379, 326, 61, 45, 68, 36, 71, 87, 81, 32, 19, 56, NA, 0, 1, 1, NA, NA, NA, NA, 16, NA, 43, 528, 507, 497, 541, 531, 415, 256, 472, 437, 517, 448, 397, 396, 301, 90, 353, 196, 78, 426, 579, 592, 577, 587, 540, 605, 523, 260, 10, 458, 587, 538, 374, 52, 531, 571, 598, 548, 549, 323, 412, 324, 241, 218, 7, 67, 46, 35, 82, 75, 60, 2, 68, 79, 0, 15, 14, 80, 78, 49, 70, 42, 30, 15, 58, NA, 19,
+#> NA, NA, NA, 3, 76, 225, 549, 598, 557, 552, 566, 581, 583, 589, 587, 521, 324, 349, 405, 462, 395, 440, 354, 177, 93, 67, 564, 581, 644, 677, 619, 504, 451, 573, 626, 657, 546, 618, 404, 485, 209, 1, 383, 374, 461, 573, 522, 584, 539, 450, 527, 561, 361, 602, 526, 253, 396, 289, 48, 65, 83, 103, 43, 82, 86, 45, 17, 27, 12, 100, 563, 610, 302, 596, 533, 554, 540, 452, 368, 378, 583, 502, 412, 8, 463, 551, 529, 565, 654, 617, 628, 443, 568, 525, 492, 656, 421, 617, 614, 93, 339, 79, 187, 139, 220,
+#> 558, 537, 637, 581, 622, 518, 240, 244, 552, 607, 635, 637, 589, 377, 553, 610, 466, 36, 16, 0, NA, NA, NA, 23, NA, NA, 0, NA, NA, NA, 22, 11, 7, 4, 1, NA, 1, NA, NA, 0, 0, 3, 0, 1, 4, 13, 15, 7, 8, NA, NA, 1, 1, 3, 5, 19, 368, 105, 145, 39, 276, 463, 562, 615, 604, 440, 528, 414, 550, 601, 553, 452, 51, 233, 130, 223, 561, 63, 547, 604, 601, 555, 571, 507, 480, 306, 385, 343, 164, 175, 52, 257, 67, 20, 368, 472, 448, 453, 518, 495, 505, 339, 470, 378, 348, 367, 429, 139, 54, 91, 147, 57, 282, 463,
+#> 412, 501, 230, 497, 489, 463, 412, 609, 470, 630, 617, 529, 541, 559, 520, 445, 270, 480, 552, 252, 566, 560, 471, 360, 562, 194, 375, 341, 216, 205, 114, 6, 24, 59, 69, 51, 62, 79, 84, 69, 63, 74, 51, 64, 79, 66, 0, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 82, 75, 62, 98, 84, 88, 91, 84, 98, 80, 84, 73, 72, 77, 64, 51, 68, NA, NA, NA, NA, NA, NA, NA, 23, NA, NA, 1, 0, NA, NA, NA, NA, NA, 7, 10, 1, 6, 0, 1, 1, 15, 17, 6, 5, NA, 3, 7, NA, 2, NA, NA, NA, NA, 0, 0, 0, 8, 3, 4, 0, 62, 22, 42,
+#> 43, 16, 46, 38, 38, 4, 6, 1, 40, 457, 634, 645, 564, 510, 645, 449, 347, 552, 464, 377, 550, 441, 427, 589, 457, 544, 505, 592, 560, 51, 165, 337, 97, 338, 539, 480, 527, 641, 623, 393, 489, 389, 613, 589, 317, 320, 278, 32, NA, NA, 0, 0, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 1, 0, NA, 58, 25, 268, 159, 129, 466, 616, 590, 565, 559, 286, 247, 630, 399, 68, 309, 313, 2, 25, 599, 531, 552, 527, 84, 518, 420, 230, 544, 609, 410, 144, 19, 481, 62, 38, 16, 32, 51, 521, 488, 289,
+#> 361, 440, 435, 398, 480, 227, 472, 468, 450, 460, 442, 389, 352, 405, 117, 86, 227, 463, 562, 585, 614, 380, 544, 396, 484, 458, 399, 438, 292, 198, 399, 193, 50, 236, 63, 77, 85, 139, 204, 304, 446, 474, 461, 467, 560, 364, 524, 549, 479, 563, 566, 563, 537, 418, 241, 57, 99, 389, 254, 478, 424, 473, 142, 237, 166, 196, 315, 354, 411, 343, 174, 81, 58, 269, 328, 581, 606, 485, 516, 119, 403, 253, 560, 356, 524, 452, 82, 5, 7, 24, 62, 446, 604, 574, 494, 384, 533, 522, 554, 579, 400, 570, 531, 243,
+#> 343, 242, 611, 610, 606, 621, 378, 550, 582, 588, 583, 495, 618, 603, 594, 558, 576, 551, 610, 433, 436, 230, 336, 160, 7, 85, 525, 609, 639, 577, 394, 608, 633, 533, 529, 496, 621, 591, 416, 529, 563, 542, 461, 292, 226, 58, 61, 430, 551, 499, 574, 513, 357, 553, 420, 564, 497, 492, 449, 404, 549, 96, 292, 431, 286, 11, 482, 405, 76, 545, 510, 255, 581, 546, 520, 96, 60, 87, 31, 0, 44, 29, 45, 47, 96, 0, NA, NA, NA, NA, NA, NA, 70, 51, 83, 69, 61, 63, 59, 65, 70, NA, NA, NA, NA, NA, 384, 580, 540,
+#> 663, 626, 627, 644, 430, 45, 119, 4, 271, 206, 3, 14, 284, 510, 594, 619, 599, 581, 546, 516, 516, 448, 495, 380, 539, 600, 497, 528, 127, 177, 107, 44, 73, 86, 77, 83, 87, 73, 79, 82, 25, NA, 7, 29, 59, 70, 60, 19, 73, 61, 26, 2, 213, 621, 647, 672, 504, 333, 563, 460, 493, 546, 510, 510, 362, 506, 505, 219, 57, 117, 496, 602, 562, 477, 379, 431, 489, 227, 160, 146, 417, 9, 0, 0, 0, 0, 0, 0, NA, NA, 0, 0, NA, NA, NA, 0, 33, 98, 441, 280, 108, 269, 189, 475, 427, 412, 316, 409, 262, 123, 45, 34,
+#> 188, 374, 560, 542, 610, 595, 376, 579, 320, 218, 550, 593, 551, 587, 348, 215, 130, 42, 535, 530, 618, 427, 502, 587, 582, 553, 214, 450, 494, 17, 230, 275, 157, 98, 43, 33, 305, 508, 570, 548, 311, 76, 169, 337, 271, 38, 0, 10, 8, 57, 77, 95, 79, 92, 93, 82, 104, 99, 94, 109, 120, 123, 90, 52, 87, 65, NA, NA, NA, 1, NA, NA, 32, 484, 423, 477, 335, 560, 643, 558, 609, 584, 604, 403, 509, 472, 470, 453, 383, 322, 249, 323, 487, 463, 300, 499, 386, 113, 483, 517, 206, 513, 292, 410, 554, 546, 591,
+#> 549, 569, 599, 239, 585, 561, 574, 589, 623, 642, 246, 86, 340, 161, 219, 115, 72, 45, 344, 558, 638, 605, 502, 577, 611, 377, 635, 578, 624, 466, 522, 635, 621, 614, 587, 503, 557, 454, 17, 102, 413, 592, 527, 437, 385, 563, 492, 203, 442, 232, 419, 496, 455, 334, 481, 257, NA, NA, NA, NA, NA, 0, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 0, NA, 8, 20, 13, 12, 9, 9, 8, 7, 10, 4, 1, 1, 42, 17, 101, 414, 305, 451, 643, 407, 590, 622, 416, 654, 661, 603, 631, 542, 250, 466, 631, 423, 553, 604, 479,
+#> 556, 670, 490, 360, 537, 618, 553, 247, 313, 568, 522, 54, 269, 82, 54, 429, 513, 400, 442, 473, 411, 214, 470, 39, 317, 256, 116, 12, 33, 545, 582, 504, 552, 431, 531, 349, 549, 320, 121, 401, 451, 152, 214, 164, 39, 141, 498, 509, 492, 615, 587, 597, 558, 388, 539, 598, 567, 633, 565, 575, 559, 414, 61, 568, 583, 547, 294, 115, 17, 2, 320, 405, 489, 524, 595, 561, 591, 628, 340, 377, 608, 534, 493, 477, 585, 339, 49, 264, 35, 303, 372, 85, 183, 433, 508, 515, 226, 589, 508, 587, 461, 401, 85, NA,
+#> NA, NA, NA, 1, 0, NA, NA, NA, 7, NA, NA, 1, NA, NA, 393, 546, 381, 410, 563, 27, 4, 41, 4, 624, 653, 388, 539, 528, 419, 614, 594, 494, 316, 506, 461, 350, 150, 95, 1, 0, 85, 27, 11, NA, NA, 56, NA, 43, 53, 81, 75, 70, 5, 32, NA, NA, 23, 70, 56, 350, 432, 409, 389, 425, 520, 533, 418, 174, 373, 443, 422, 240, 155, 130, 198, 298, 507, 560, 511, 586, 544, 536, 502, 570, 583, 363, 561, 507, 363, 250, 384, 129, 584, 586, 621, 486, 167, 13, 486, 451, 135, 209, 388, 459, 309, 115, 472, 305, 350, 502, 474,
+#> 36, 24, 211, 168, 395, 532, 255, 353, 535, 248, 549, 592, 561, 6, 122, 492, 515, 695, 676, 434, 645, 405, 152, 355, 70, 66, 359, 46, 60, 5, 51, 66, 30, 12, 3, 5, 14, 27, 50, 65, 83, 80, 51, 89, 85, 83, 68, NA, NA, NA, NA, NA, 23, 17, 4, 24, 13, 18, 20, 24, 14, 13, 7, 10, 4, 6, 8, 1, 2, 3, 3, 34, 34, 0, 58, 72, 21, NA, NA, NA, 0, NA, 52, 388, 573, 390, 543, 471, 559, 523, 329, 219, 144, 156, 6, 34, 198, 588, 705, 439, 585, 576, 541, 605, 631, 610, 591, 383, 307, 294, 396, 221, 21, 0, NA, 1, 0, NA,
+#> NA, NA, 0, NA, 0, 43, 448, 460, 560, 392, 489, 505, 555, 605, 574, 597, 466, 449, 559, 375, 102, 401, 292, 223, 193, 127, 219, 32, 282, 532, 555, 443, 325, 193, 270, 452, 366, 51, 6, 27, 503, 311, 522, 533, 505, 549, 374, 557, 541, 596, 555, 490, 523, 455, 153, 244, 248, 285, 590, 587, 609, 450, 488, 552, 412, 537, 514, 600, 575, 593, 512, 550, 518, 545, 381, 156, 227, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 1, 4, 1, 453, 138, 56, 11, 1, 7, 8, 0, NA, NA, NA, NA, 0, NA, NA, NA, 46, 288, 493, 553,
+#> 348, 486, 605, 578, 549, 327, 466, 424, 433, 470, 402, 83, 192, 20, 126, 178, 38, 253, 147, 252, 332, 305, 450, 469, 514, 592, 400, 602, 411, 461, 341, 346, 114, 121, 440, 495, 561, 551, 541, 111, 382, 493, 572, 394, 515, 529, 441, 41, 256, 283, 162, 127, 29, 78, 62, 72, 83, 73, 78, 41, 73, 54, 16, 45, 76, 57, 7, 25, 24, 12, 16, 100, 282, 469, 519, 234, 300, 246, 120, 282, 216, 284, 264, 296, 139, 227, 63, 8, 2, 0, NA, NA, NA, NA, NA, 31, 45, 77, 28, 18, NA, 10, 45, 46, 16, 4, 5, 5, 22, 5, 11, 0,
+#> 15, 2, 37, 507, 577, 566, 502, 564, 555, 487, 551, 312, 556, 581, 505, 500, 256, 104, 1, 64, 95, 91, 79, 97, 109, 92, 44, 66, 69, NA, NA, 12, 32, 63, 17, 5, 65, 3, 150, 295, 343, 294, 195, 153, 82, 0, 351, 591, 423, 536, 513, 502, 547, 608, 358, 554, 235, 306, 489, 470, 396, 318, 163, 296, 407, 465, 115, 288, 542, 438, 96, 324, 379, 179, 72, 7, 72, 70, 50, 3, 70, 62, 67, 67, 75, 64, 42, 35, 50, 14, NA, NA, NA, NA, NA, NA, NA, NA, 0, NA, 0, NA, 3, 7, 1, NA, NA, NA, 453, 654, 602, 399, 482, 299, 597,
+#> 401, 591, 554, 556, 551, 507, 16, 496, 6, 363, 239, 278, 628, 440, 536, 574, 639, 385, 425, 81, 368, 202, NA, NA, 0, 0, NA, NA, 0, NA, 0, NA, 1, 0, NA, NA, NA, NA, NA, NA, 8, 62, 183, 347, 575, 584, 535, 487, 61, 545, 215, 149, 570, 498, 427, 146, 106, 134, 316, 452, 359, 387, 228, 310, 227, 86, 196, 335, 197, 121, 130, NA, NA, NA, 58, 79, 71, NA, NA, NA, NA, NA, 65, 76, 530, 384, 569, 369, 598, 589, 607, 616, 614, 566, 592, 574, 349, 214, 544, 62, 42, 39, 598, 663, 641, 642, 627, 624, 575, 646,
+#> 600, 650, 637, 641, 444, 550, 640, 615, 601, 332, 309, 477, 119, 638, 623, 569, 488, 633, 610, 632, 651, 615, 652, 567, 119, 24, 41, 38, 543, 250, 597, 525, 633, 600, 424, 60, 203, 18, 1, 167, 440, 522, 511, 422, 489, 346, 575, 370, 547, 427, 512, 453, 9, 303, 328, 539, 337, 473, 542, 484, 439, 73, 51, 18, 85, 49, 57, 12, 85, 13, 31, 21, 6, 7, 11, 52, 81, 63, 40, NA, 18, 2, 23, 15, 0, 3, NA, NA, NA, NA, NA, NA, NA, NA, NA, 155, 46, 240, 227, 452, 557, 628, 363, 567, 371, 164, 108, 484, 145, 170,
+#> 0, 1, 0, 0, NA, NA, NA, 0, 0, 0, NA, NA, NA, NA, NA, 1, 4, 30, 298, 176, 592, 492, 504, 448, 96, 508, 167, 114, 482, 466, 353, 158, 24, 199, 59, 41, 79, 77, 74, 96, 71, 77, 81, 55, 85, 82, 49, 14, NA, NA, NA, 0, 0, 0, NA, 0, NA, NA, NA, NA, NA, NA, NA, 6, 7, 13, 40, 11, 109, 145, 174, 42, 270, 441, 368, 362, 251, 344, 347, 330, 362, 327, 141, 167, 151, 128, 147, 9, NA, 0, NA, NA, 0, 0, 64, 46, 0, 44, 67, 51, 73, 70, NA, NA, NA, 6, 77, 47, 81, 54, 6, 635, 633, 636, 609, 627, 523, 618, 606, 615, 585,
+#> 612, 456, 223, 554, 447, 21, 210, 497, 542, 546, 546, 510, 384, 505, 424, 491, 464, 410, 304, 112, 263, 174, 67, 19, 422, 601, 571, 612, 497, 620, 562, 199, 113, 501, 497, 474, 475, 156, 200, 309, 300, 269, 271, 11, 92, 65, 551, 618, 386, 609, 507, 278, 93, 271, 486, 563, 299, 0, 0, 5, 16, 34, 7, 5, NA, 0, 5, NA, NA, 29, 520, 466, 379, 296, 80, 159, 225, 169, 61, 277, 47, 420, 522, 393, 475, 532, 543, 476, 542, 505, 156, 100, 92, 87, 202, 29, 295, 49, 338, 582, 625, 653, 580, 551, 584, 621, 619,
+#> 546, 514, 560, 366, 460, 501, 353, 435, 292, 389, 378, 487, 539, 592, 584, 589, 592, 472, 502, 431, 260, 102, 647, 576, 555, 594, 579, 127, 472, 602, 530, 404, 29, 109, 248, 382, 562, 549, 530, 532, 432, 512, 265, 355, 303, 171, 17, 292, 332, 406, 161, 315, 439, 579, 565, 558, 612, 409, 570, 594, 600, 544, 479, 365, 80, 56, 267, 95, 496, 619, 17, 251, 278, 66, 258, 435, 552, 539, 275, 245, 163, 325, 431, 361, 532, 517, 397, 439, 408, 443, 294, 131, 32, 24, 51, 10, 6, 32, 79, 74, 40, 29, 5, 37, NA,
+#> 27, NA, 0, 20, 313, 647, 615, 622, 575, 580, 530, 429, 517, 457, 609, 551, 415, 384, 502, 201, 271, 321, 135, 11, 78, 89, 0, 9, 16, 9, 13, 6, 5, 2, NA, NA, NA, 2, 0, 0, NA, 2, NA, NA, NA, 0, 0, 38, 175, 290, 266, 401, 531, 581, 441, 487, 542, 253, 315, 462, 56, 403, 330, 227, 16, 1, 8, 19, 0, 3, 2, 13, 0, 1, 0, 0, NA, NA, 7, 4, 370, 221, 536, 469, 324, 199, 166, 187, 57, 53, 23, 57, 29, 4, 19, 95, 73, 84, 94, NA, NA, 19, 567, 578, 479, 580, 478, 498, 494, 462, 104, 70, 93, 81, 64, 90, 40, 75, 63,
+#> 72, 70, 12, NA, 4, 2, 2, 1, 2, 0, 190, 304, 606, 622, 642, 589, 521, 604, 573, 530, 520, 489, 419, 535, 451, 592, 461, 411, 127, 102, 2, 28, 65, 78, 52, 1, 40, 48, 83, 86, 84, 74, 90, NA, 1, 29, 12, 279, 603, 652, 677, 569, 599, 631, 394, 587, 640, 530, 372, 458, 37, 58, 34, NA, 24, 0, NA, NA, 5, 0, NA, NA, NA, NA, 0, NA, NA, 28, 45, 58, 14, 35, 1, 5, 4, 0, 5, 85, 397, 443, 539, 394, 458, 444, 423, 282, 129, 30, 11, 212, 596, 581, 582, 569, 480, 593, 592, 573, 626, 577, 537, 477, 414, 327, 190, 162,
+#> 0, 8, 4, 1, 10, 8, 9, 7, 8, 0, NA, 0, NA, 0, 0, NA, 2, NA, 491, 547, 560, 566, 597, 516, 524, 40, 457, 365, 415, 499, 490, 264, 16, 232, 107, 636, 600, 623, 616, 563, 497, 278, 229, 373, 438, 293, 162, 84, 14, 163, 112, 606, 607, 641, 610, 614, 613, 562, 558, 627, 410, 81, 358, 457, 586, 561, 605, 306, 430, 588, 542, 568, 357, 306, 168, 61, 491, 280, 608, 596, 569, 640, 570, 505, 599, 333, 172, 94, 321, 488, 478, 416, 326, 385, 495, 134, 318, 293, 345, 85, 222, 61, 84, 67, 322, 641, 526, 603, 569,
+#> 545, 289, 133, 10, 222, 411, 493, 313, 558, 596, 559, 510, 304, 50, 561, 100, 447, 155, 60, NA, NA, NA, NA, NA, 76, 94, 72, 35, 13, 46, 2, 46, 18, 44, 475, 534, 625, 559, 612, 336, 159, 16, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 1, 2, 4, 4, 3, 2, 3, 1, 72, 58, 27, 2, 12, 9, 41, 48, 48, 47, 72, 95, 80, 71, 75, 54, 1, 26, 508, 584, 588, 560, 596, 584, 468, 498, 577, 586, 456, 50, 281, 327, 514, 522, 502, 128, 306, 280, 10, 95, 394, 388, 320, 539, 589, 590, 468, 441, 80, 476, 284, 95, 557,
+#> 691, 680, 624, 657, 635, 551, 611, 639, 622, 439, 538, 34, 233, 564, 687, 578, 648, 573, 635, 558, 622, 173, 353, 366, 384, 409, 486, 485, 64, 59, 180, 418, 510, 523, 482, 528, 428, 8, 249, 231, 28, NA, NA, 0, 0, NA, NA, NA, NA, NA, NA, NA, NA, 1, 7, 10, 6, 1, 0, 0, 0, 2, 0, 0, 96, 600, 630, 610, 227, 481, 572, 366, 73, 231, 429, 396, 360, 388, 583, 430, 111, 218, 256, 61, 350, 574, 578, 561, 581, 327, 176, 398, 113, 40, 183, 384, 540, 233, 300, 439, 500, 562, 293, 214, 12, 24, 205, 289, 204, 449,
+#> 498, 462, 151, 299, 260, 15, 104, 94, 105, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 0, 0, 23, 85, 71, NA, NA, NA, 6, NA, 2, 26, 19, 17, 64, 5, 4, 2, 0, 6, 4, NA, 2, 2, 0, NA, NA, NA, NA, NA, 64, NA, NA, NA, 2, NA, NA, NA, NA, NA, 24, 2, 262, 559, 578, 583, 391, 613, 447, 586, 640, 633, 309, 513, 162, 406, 113, 237, 7, 34, 303, 340, 352, 190, 279, 336, 293, 97, 5, 139, 98, 174, 122, 415, 474, 472, 462, 453, 285, 267, 75, 376, 120, 415, 158, 452, 191, 254, 156, 521, 584, 450, 251,
+#> 666, 608, 46, 576, 437, 465, 609, 615, 418, 665, 609, 636, 454, 525, 660, 538, 502, 10, 26, 411, 216, 18, 127, 278, 516, 514, 507, 341, 503, 374, 160, 566, 478, 53, 557, 550, 490, 523, 483, 467, 84, 135, 317, 423, 366, 174, 509, 521, 236, 299, 62, 546, 492, 462, 344, 580, 386, 469, 337, 266, 481, 341, 29, 350, 252, 477, 478, 401, 175, 23, 53, 24, 461, 382, 268, 111, 240, 456, 384, 217, 79, 49, 11, 65, 701, 663, 591, 655, 629, 333, 199, 492, 594, 102, 122, 261, 136, 171, 34, 188, 95, 50, NA, 0, NA,
+#> NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 2, NA, 9, 37, 59, 76, 42, 28, 4, 40, 28, 71, 49, 25, 57, NA, 26, NA, NA, 0, NA, NA, NA, NA, NA, NA, NA, 55, 56, 69, 0, NA, 0, 0, 0, NA, 0, 0, 0, 1, 0, NA, 15, 391, 351, 454, 379, 456, 438, 389, 369, 406, 514, 447, 422, 338, 0, 50, 76, 71, 90, 85, 77, 7, 31, 68, 73, 44, NA, NA, 3, 66, 62, 7, 59, 10, 104, 445, 530, 598, 613, 642, 631, 458, 485, 207, 7, 51, 639, 455, 636, 443, 642, 641, 598, 403, 427, 552, 265, 563, 474, 158, 390, 309, 361, 424, 418, 564, 587,
+#> 476, 493, 491, 614, 323, 374, 63, 214, 8, 3, 303, 354, 549, 549, 553, 526, 523, 237, 150, 305, 154, 3, 6, 4, 2, 1, 3, 5, 1, 1, 1, 3, 0, 1, 0, 2, 0, 1, 0, 0, 0, 0, 26, 452, 236, 445, 133, 316, 500, 423, 427, 517, 393, 347, 279, 192, 538, 304, 567, 582, 344, 552, 258, 71, 13, 125, 29, 560, 658, 636, 599, 495, 613, 548, 582, 589, 107, 532, 433, 432, 289, 141, 1, 90, 338, 197, 320, 233, 165, 40, 50, 31, 35, 412, 590, 578, 610, 544, 180, 540, 327, 481, 295, 75, 321, 551, 609, 572, 579, 375, 325, 470,
+#> 417, 554, 626, 600, 555, 494, 156, 243, 292, 272, 10, 234, 192, 466, 584, 616, 625, 577, 438, 502, 403, 237, 317, 595, 562, 97, 236, 119, 239, 174, 1, 3, 10, NA, NA, 23, 67, 26, 33, 0, NA, NA, NA, 0, NA, 159, 439, 588, 325, 614, 464, 533, 384, 427, 496, 517, 224, 538, 583, 396, 156, 507, 241, 346, 18, 41, 4, 295, 195, 284, 344, 315, 412, 395, 446, 398, 385, 180, 62, 0, 5, 39, 7, NA, NA, 0, NA, NA, 0, NA, 0, NA, 0, NA, NA, NA, NA, NA, 408, 529, 575, 588, 600, 565, 513, 491, 389, 454, 436, 393, 554,
+#> 251, 256, 171, NA, NA, NA, NA, NA, 90, 36, 37, 23, 36, 24, 65, 57, 31, 9, 13, 7, 140, 525, 564, 560, 590, 552, 545, 521, 522, 373, 351, 180, 82, 396, 439, 515, 405, 71, 284, 201, 2, 11, 30, 46, 12, 8, 7, 23, 10, 13, NA, NA, 1, NA, 3, 1, 0, NA, 10, 67, 76, 81, 65, 82, 73, 31, 6, 34, NA, 0, 0, 1, 0, 23, 61, 41, 69, 50, 18, 38, 10, 3, 14, 328, 196, 268, 505, 543, 524, 371, 360, 323, 310, 92, 114, 59, 127, 21, 57, NA, NA, NA, 1, NA, NA, 0, NA, 0, NA, NA, NA, NA, NA, NA, 0, NA, 0, 0, 1, 1, NA, 0, NA,
+#> 0, 0, NA, 2, 0, 0, 0, 475, 392, 270, 55, 2, 68, 162, 47, 68, 34, 5, 295, 536, 551, 557, 528, 531, 255, 302, 424, 528, 617, 564, 564, 529, 566, 170, 343, 523, 297, 72, 76, 211, 211, 211, 283, 411, 444, 501, 525, 522, 339, 429, 491, 44, 382, 643, 615, 634, 608, 661, 101, 500, 630, 426, 215, 264, 158, 360, 90, 48, 74, 60, 344, 419, 174, 133, 307, 170, 28, 155, 66, 355, 389, 220, 554, 495, 571, 590, 564, 350, 235, 227, 169, 123, 443, 555, 546, 613, 610, 437, 553, 605, 619, 646, 639, 377, 617, 577, 628,
+#> 633, 590, 548, 517, 0, NA, 0, NA, NA, NA, NA, NA, NA, NA, NA, 6, 4, 4, 7, 0, 4, 28, 250, 581, 346, 575, 471, 545, 492, 73, 10, 331, 477, 287, 419, 71, 156, 51, 93, 150, 216, 186, 147, 9, 163, 419, 564, 530, 395, 86, 504, 442, 315, 94, 508, 164, 134, 12, 29, 19, 70, 45, 85, 73, 51, 50, 76, 83, NA, NA, NA, 0, NA, NA, 1, NA, 59, 76, 77, 84, 84, 89, 71, 58, 60, 56, 1, 1, 16, 13, 143, 341, 569, 545, 592, 429, 446, 65, 1, 19, 445, 184, 299, 215, 292, 203, 418, 451, 409, 137, 356, 220, 167, 116, 194, 146,
+#> 128, 46, 62, 22, 558, 540, 399, 588, 474, 235, 499, 149, 278, 613, 424, 357, 147, 390, 393, 439, 518, 198, 33, 455, 597, 548, 565, 582, 433, 260, 545, 608, 633, 606, 520, 364, 197, 166, 300, 491, 428, 528, 131, 359, 387, 98, 413, 551, 538, 580, 519, 510, 473, 539, 391, 506, 517, 532, 552, 355, 480, 476, 403, 390, 373, 42, 367, 340, 12, 42, 96, 81, 83, 88, 88, 91, 63, 72, 68, 67, 75, 64, 80, 64, 59, 68, 69, 76, 43, 25, 62, 13, 42, 11, 49, 53, 95, 522, 516, 462, 36, 389, 265, 372, 277, 61, 2, 8, 7,
+#> 2, 5, 1, NA, NA, 0, 0, 7, 4, 5, 4, 29, 7, 2, 1, 0, 0, 0, 0, 1, NA, 0, NA, NA, NA, NA, NA, NA, 1, NA, 51, 439, 396, 484, 585, 352, 411, 140, 495, 540, 429, 249, 275, 381, 398, 74, 83, 175, 174, 573, 624, 594, 573, 425, 494, 391, 200, 361, 381, 35, 245, 156, 292, 617, 589, 529, 579, 445, 283, 404, 596, 510, 627, 371, 408, 215, 134, 134, 290, 365, 35, 341, 429, 374, 461, 408, 408, 435, 345, 348, NA, NA, NA, NA, 37, 38, 62, 67, 72, 82, 49, 22, 0, 16, 16, 60, 67, 62, 74, 77, 81, 56, 63, 76, 63, 71, 65,
+#> 68, 57, 68, 53, 54, 64, 53, 56, 19, 545, 623, 586, 637, 571, 589, 392, 517, 588, 412, 588, 563, 610, 575, 590, 253, 263, 110, 61, 45, 493, 606, 592, 554, 401, 492, 586, 183, 590, 588, 469, 456, 465, 109, 283, 152, 48, 195, 80, 220, 459, 485, 330, 243, 219, 407, 50, 160, NA, 0, NA, 0, NA, NA, NA, NA, NA, NA, 0, 67, 532, 515, 559, 593, 550, 477, 510, 375, 492, 462, 394, 392, 274, 30, 79, 76, 75, 49, 53, 46, 1, 1, 26, 1, NA, 0, NA, NA, 0, NA, 0, 0, 0, 565, 600, 602, 445, 538, 578, 611, 603, 603, 400,
+#> 521, 300, 554, 586, 535, 400, 448, 568, 566, 540, 562, 590, 600, 571, 605, 572, 100, 191, 559, 573, 549, 399, 493, 527, 530, 585, 486, 582, 68, 523, 546, 240, 105, 466, 531, 186, 60, 51, 244, 489, 663, 588, 621, 651, 634, 638, 622, 603, 435, 558, 625, 612, 283, 105, 83, 563, 260, 575, 561, 544, 606, 410, 419, 502, 383, 516, 82, 343, 171, 81, 309, 41, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 21, 280, 420, 473, 363, 492, 639, 597, 579, 600, 363, 442, 408, 511, 527, 504, 547, 502, 302, 96, 327, 98, 398,
+#> 124, 486, 510, 589, 619, 603, 594, 403, 552, 547, 555, 595, 593, 510, 476, 298, 135, 143, 611, 578, 514, 502, 468, 431, 290, 43, 97, 47, 419, 487, 528, 490, 395, 494, 272, 568, 454, 438, 314, 497, 477, 454, 108, 150, 315, 17, 62, 74, 65, 75, 71, 37, 56, 78, 79, 51, 62, 7, 2, 1, 2, 68, 64, 54, 8, 2, 13, 579, 356, 54, 334, 317, 132, 14, 545, 619, 406, 551, 608, 628, 507, 578, 584, 438, 524, 336, 103, 43, 32, 171, 487, 544, 528, 135, 326, 511, 499, 542, 556, 502, 556, 470, 328, 497, 486, 60, 90, 545,
+#> 584, 536, 422, 352, 541, 533, 606, 562, 461, 532, 277, 327, 127, 1, 232, 557, 659, 607, 464, 567, 616, 595, 557, 322, 574, 334, 397, 80, 368, 487, 175, 557, 236, 258, 322, 213, 519, 444, 136, 301, 549, 501, 515, 492, 576, 573, 584, 151, 494, 418, 268, 3, 103, 138, 129, 144, 368, 459, 285, 485, 510, 257, 342, 12, 126, 269, NA, NA, NA, NA, NA, NA, 54, 43, 391, 367, 608, 653, 527, 301, 55, 333, 323, 72, 13, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 0, NA, NA, NA, 4, 0, 1, NA, 0, NA,
+#> 0, NA, 2, 0, 0, 154, 241, 346, 291, 480, 488, 295, 35, 143, 57, 94, 69, 159, 160, 20, 14, 6, 4, 14, 42, 53, 117, 74, 576, 569, 459, 481, 662, 493, 600, 465, 543, 517, 352, 180, 208, 339, 276, 367, 469, 173, 317, 387, 255, 426, 483, 560, 286, 542, 542, 565, 576, 574, 613, 611, 582, 250, 567, 568, 579, 513, 266, 177, 344, 167, 153, 549, 420, 477, 547, 498, 492, 443, 494, 129, 336, 227, 7, 116, 200, 13, 178, 349, 432, 316, 379, 82, 145, 337, 291, 137, 74, 288, 558, 653, 630, 475, 551, 671, 558, 542,
+#> 603, 595, 448, 343, 587, 562, 137, 14, 125, 211, 271, 583, 608, 632, 604, 424, 530, 527, 573, 549, 589, 565, 428, 49, 116, 8, 358, 454, 458, 551, 384, 492, 398, 524, 557, 581, 565, 572, 553, 539, 164, 261, 173, NA, NA, NA, 3, 64, 75, 28, 40, 63, 81, 76, 50, 31, 30, 83, 86, 52, 7, 0, 2, 2, 2, 0, 0, NA, NA, NA, NA, NA, 0, 0, 0, 0, 0, 79, 515, 373, 537, 581, 582, 463, 353, 568, 475, 483, 528, 186, 211, 69, 547, 405, 434, 547, 556, 18, 149, 394, 534, 482, 503, 478, 234, 455, 398, 399, 309, 312, 593,
+#> 657, 624, 442, 557, 424, 83, 467, 511, 57, 80, 182, 207, 85, 158, 30, 216, 249, 122, 189, 181, 173, 423, 290, 399, 397, 260, 87, 156, 341, 427, 185, 97, 218, 23, 461, 585, 594, 412, 546, 602, 634, 609, 610, 559, 236, 431, 431, 429, 159, 352, 590, 246, 345, 637, 315, 254, 134, NA, 31, 80, 77, 70, 72, 65, NA, NA, NA, NA, NA, NA, 3, 3, 3, 3, 1, 4, 35, 222, 320, 522, 451, 163, 309, 337, 77, 77, 585, 470, 270, 164, 79, 2, 2, 4, 3, 3, 3, 0, 1, 0, 0, 0, 1, 0, 0, 49, 312, 208, 239, 318, 146, 86, 434, 536,
+#> 634, 616, 580, 601, 388, 572, 270, 299, 162, 361, 34, 99, 142, 15, 5, 341, 482, 422, 344, 540, 538, 584, 454, 513, 484, 565, 601, 427, 345, 328, 49, NA, NA, NA, NA, 34, 66, 46, 28, 65, 48, 29, 29, 48, 4, 50, 3, 126, 475, 415, 514, 198, 570, 341, 194, 148, 348, 268, 18, 143, 436, 66, 51, 20, 91, 595, 451, 483, 597, 405, 309, 444, 409, 524, 451, 493, 84, 521, 335, 389, 100, 215, 41, 9, 7, NA, NA, NA, NA, 0, NA, NA, NA, NA, 32, 7, 97, 83, 80, 89, 36, 80, 8, 6, 15, 50, 26, 14, 419, 223, 544, 575, 531,
+#> 435, 570, 536, 285, 422, 330, 346, 367, 44, 0, 203, 83, 585, 541, 574, 506, 543, 406, 526, 546, 486, 452, 273, 208, 171, 185, 11, 315, 386, 416, 113, 346, 426, 286, 135, 451, 244, 356, 305, 46, 217, 464, 596, 607, 545, 373, 562, 655, 560, 619, 590, 539, 495, 505, 516, 404, 224, 406, 426, 94, 219, 355, 539, 394, 550, 635, 527, 609, 524, 614, 487, 79, NA, NA, 0, NA, NA, NA, NA, 0, NA, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 1, 0, 0, NA, NA, NA, NA, 0, 0, NA, 0, NA, NA, NA, 0, NA, 1, 512, 569, 378, 438, 425,
+#> 200, 409, 458, 30, 66, 75, 69, 20, 30, 56, 6, 5, 63, 65, 26, 4, 0, 53, 290, 484, 550, 561, 571, 522, 439, 529, 436, 569, 568, 554, 449, 483, 365, 187, 352, 69, 196, 17, 185, 468, 301, 520, 527, 575, 588, 450, 35, 60, 208, 5, 16, 337, 130, 527, 629, 612, 645, 615, 331, 445, 93, 543, 542, 583, 494, 21, 254, 46, 138, 349, 445, 387, 538, 484, 579, 633, 561, 662, 593, 114, 461, 391, 99, 84, 532, 316, 262, 598, 426, 564, 498, 642, 643, 625, 604, 577, 556, 517, 478, 380, 412, 98, 117, 154, 321, 452, 505,
+#> 496, 440, 494, 557, 526, 480, 578, 508, 193, 490, 432, 503, 345, 17, 276, 71, 206, 101, 62, 61, 289, 558, 431, 502, 599, 204, 525, 500, 476, 447, 498, 467, 350, 365, 250, 90, 29, 217, NA, NA, NA, NA, NA, NA, 4, 2, 11, 6, 7, 5, 2, 1, 3, 4, 2, 5, 22, 42, 32, 23, 59, 19, 24, NA, 19, 25, 4, 0, 40, 385, 496, 400, 484, 287, 312, 481, 478, 340, 441, 505, 453, 446, 295, 325, 73, 320, 261, 567, 408, 563, 551, 509, 499, 591, 537, 540, 612, 445, 561, 485, 420, 126, 240, 549, 602, 591, 587, 522, 568, 594, 622,
+#> 615, 553, 607, 417, 146, 367, 131, 343, NA, NA, NA, NA, NA, NA, 7, 5, 6, 60, 0, 0, 5, 1, 22, 69, 192, 204, 163, 406, 543, 563, 358, 470, 564, 540, 244, 266, 364, 45, 16, 16, 277, 333, 489, 414, 489, 246, 481, 438, 347, 457, 579, 395, 279, 63, 21, 7, 0, 5, 4, 4, NA, 0, 1, 0, 0, 0, 2, 12, 7, 3, 9, 28, 3, 3, 1, 0, 0, 0, 0, 0, 48, 582, 654, 626, 627, 593, 614, 644, 482, 643, 654, 623, 639, 596, 634, 663, 546, 683, 63, 581, 103, 478, 296, 175, 261, 167, 261, 117, 298, 132, 228, 148, 35, 268, 68, 156,
+#> 54, 142, 601, 587, 686, 502, 554, 632, 624, 607, 601, 605, 572, 583, 510, 444, 522, 373, 463, 156, 523, 132, 490, 228, 366, 568, 468, 154, 452, 456, 607, 603, 496, 404, 71, 344, 142, 128, 10, NA, NA, NA, 4, 5, 5, 4, 3, 7, 23, 62, 62, 4, 2, 5, 4, 4, 2, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 70, 48, 57, 57, 58, 62, 53, 53, 54, 18, 0, 2, 5, 3, 2, 8, 3, 3, 3, 0, 4, 0, 0, 0, 0, 0, 0, 0, 0, 1, 2, 4, 44, 63, 64, 69, 7, 2, 0, 0, 5, 3, 2, 69, 38, 9, 39, 14, 73, 221, 580, 559, 598, 631, 608, 597, 436, 554,
+#> 626, 614, 619, 565, 565, 600, 546, 561, 550, 369, 502, 356, 505, 520, 133, 461, 460, 117, 61, 1, 29, 82, 45, 18, 89, 81, 64, 74, 81, 82, 23, 45, 75, 17, 2, 40, 14, 61, 46, 1, 3, NA, NA, NA, 15, 7, NA, 6, 5, 3, 2, 0, 0, 0, 0, 87, 684, 604, 532, 529, 83, 635, 658, 156, 165, 230, 469, 431, 163, 160, 130, 561, 601, 421, 483, 554, 375, 205, 559, 500, 196, 521, 392, 408, 137, 338, 471, 252, 294, 68, 112, 460, 408, 329, 519, 595, 594, 531, 589, 569, 589, 511, 476, 458, 303, 165, 67, 456, 386, 352, 343,
+#> 597, 380, 431, 265, 519, 361, 200, NA, 11, 14, 42, 74, 14, 55, 72, 63, 37, 37, 0, 56, 45, 11, NA, NA, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 1, 1, 0, 0, 0, NA, NA, NA, NA, NA, NA, NA, NA, 28, NA, NA, NA, 4, 6, 6, 2, 4, 6, 57, 7, 0, 5, 15, 38, 68, 87, 213, 324, 389, 428, 479, 530, 473, 470, 428, 129, 271, 381, 513, 520, 443, 583, 608, 463, 623, 608, 622, 593, 53, 273, 106, 399, 582, 592, 656, 625, 560, 595, 570, 586, 565, 572, 209, 281, 278, 190, 233, NA, NA, NA, NA, NA, 50, 50, 61, 22, 0, 8, 0, 0, 12,
+#> 7, NA, NA, 0, 0, NA, NA, NA, 0, NA, 0, 0, 0, 0, 0, 1, 0, 1, 0, 0, 0, 0, 0, 93, 583, 486, 594, 542, 482, 165, 16, 234, 20, 54, 40, 48, 72, 61, 45, 18, 6, 1, 0, 0, 0, 0, 0, 1, 151, 230, 316, 357, 45, 67, 527, 594, 549, 464, 585, 304, 107, 223, 267, 189, 193, 316, 19, 268, 541, 519, 342, 119, 582, 187, 355, 572, 560, 524, 216, 12, 86, 113, 382, 542, 501, 569, 370, 392, 375, 141, 361, 573, 550, 461, 485, 251, 37, NA, NA, NA, 1, NA, NA, 0, NA, NA, 75, 72, 82, 78, 66, 36, 20, 63, 0, 2, 7, 3, 9, 0, 0, 0,
+#> 3, 11, 35, 48, 6, 33, 379, 422, 429, 630, 614, 610, 619, 582, 611, 590, 581, 417, 113, 446, 397, 133, 585, 518, 428, 421, 107, 244, 79, 47, 166, 455, 313, 510, 389, 121, 476, 508, 476, 392, 209, 77, 10, 302, 594, 480, 533, 425, 573, 571, 529, 184, 213, 453, 199, 3, 524, 598, 597, 601, 567, 579, 572, 548, 555, 472, 358, 411, 513, 439, 488, 317, 455, 387, 13, 156, 191, 149, 309, 22, 10, 117, 350, 170, 38, 0, 5, 1, 3, 0, 2, 0, 2, 2, 2, 3, 0, 0, 0, 0, 0, 0, 58, 663, 372, 617, 637, 521, 333, 266, 582,
+#> 510, 554, 606, 308, 220, 353, 167, 547, 554, 403, 478, 7, 16, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 130, 91, 488, 519, 530, 573, 569, 574, 505, 570, 458, 521, 524, 538, 598, 94, 335, 368, 518, 557, 628, 544, 457, 490, 514, 519, 368, 50, 37, 27, 325, 623, 610, 571, 599, 614, 394, 612, 520, 607, 574, 541, 383, 593, 562, 0, 1, 48, 42, 73, 61, 74, 73, 79, 64, 60, 64, 25, 24, 37, 0, 22, 61, 60, NA, NA, 8, NA, NA, NA, NA, NA, 3, 2, 2, 2, 1, 5, 5, 2, 1, 18, 3, 73, 51, 42, 26, 13, NA, NA, NA, 3, 79, 75, 60, 1, 16,
+#> 0, 2, 48, 3, 5, 6, 29, 5, 6, 5, 1, 0, 1, 0, 0, 0, 0, 0, 0, NA, NA, NA, NA, NA, NA, NA, 1, 66, 55, 53, NA, 32, 31, 4, 292, 263, 214, 608, 601, 367, 232, 488, 221, 532, 529, 539, 508, 590, 503, 208, 539, 537, 585, 676, 631, 625, 258, 495, 609, 95, 310, 322, 134, NA, 0, 0, NA, NA, NA, NA, NA, 3, 4, 25, 3, 4, 2, 3, 4, 5, 3, 7, 2, 1, 53, 166, 313, 320, 320, 163, 417, 381, 315, 441, 385, 443, 160, 45, 313, 647, 690, 651, 382, 199, 554, 328, 62, 319, 572, 236, 65, 64, 93, 530, 578, 580, 587, 553, 583, 547,
+#> 509, 546, 557, 299, 544, 398, 421, 240, 397, 176, 536, 519, 562, 575, 510, 520, 560, 535, 264, 417, 446, 254, 458, 24, 269, 176, 131, 89, 186, 60, 113, 192, 496, 415, 472, 102, 335, 580, 526, 511, 587, 607, 623, 505, 540, 553, 407, 494, 440, 0, 5, 5, 1, 0, 0, 0, 0, 0, 0, 3, 0, 2, 0, 0, 3, 0, 0, 0, 3, 4, 2, 0, 0, 3, 0, 1, 0, 0, 1, 0, 0, 0, 0, 455, 324, 636, 664, 563, 616, 654, 581, 143, 613, 383, 137, 196, 477, 35, 165, 551, 563, 588, 569, 319, 207, 538, 540, 385, 544, 29, 412, 0, 14, 188, 358, 379,
+#> 505, 484, 511, 481, 449, 474, 465, 506, 168, 383, 383, 344, 69, 535, 624, 588, 593, 590, 606, 202, 305, 593, 595, 561, 465, 323, 329, 431, 617, 517, 585, 562, 493, 544, 587, 586, 623, 598, 494, 503, 460, 243, 299, 25, 327, 14, 543, 467, 487, 107, 284, 275, 314, 166, 285, 18, 45, 356, 501, 552, 585, 588, 475, 625, 485, 341, 89, 30, 111, 160, 278, 228, 69, 38, 11, 379, 396, 542, 543, 540, 545, 534, 493, 308, 552, 571, 444, 544, 162, 94, 143, 0, 17, 384, 336, 564, 561, 581, 520, 372, 557, 600, 551,
+#> 451, 573, 580, 534, 606, 549, 521, 692, 647, 679, 704, 679, 695, 678, 686, 639, 680, 677, 227, 402, 520, 359, 398, 45, 124, 288, 554, 324, 637, 154, 487, 631, 622, 259, 115, 160, 327, 328, 226, 149, 425, 412, 458, 523, 422, 447, 450, 403, 387, 439, 349, 216, 95, 63, 18, 261, 382, 422, 626, 563, 626, 228, 390, 540, 607, 638, 661, 242, 414, 494, 324, 126, 1, 0, 164, 335, 66, 108, 152, 458, 436, 303, 473, 578, 372, 282, 248, 404, 204, 157, NA, NA, NA, 0, 0, 5, 0, 1, 0, 0, 1, 0, 1, 0, 0, 0, 0, 0, 590,
+#> 590, 591, 592, 591, 535, 565, 524, 568, 587, 579, 607, 391, 633, 602, 21, 473, 387, 540, 392, 262, 209, 483, 550, 547, 614, 618, 609, 524, 579, 379, 579, 586, 464, 341, 19, 318, 102, 413, 558, 509, 636, 538, 505, 138, 261, 426, 440, 329, 407, 122, 4, 5, 5, 4, 4, 62, 25, 2, 0, 4, NA, 3, 0, 2, 0, 3, 0, 0, 1, 2, 102, 598, 478, 474, 449, 468, 416, 451, 279, 339, 529, 342, 380, 168, 0, 281, 391, 126, 371, 57, 15, 49, 83, 67, 160, 98, 0, 5, 4, 6, 4, 7, 3, 62, 51, 51, 51, 13, 53, 34, 0, 1, 101, 473, 325,
+#> 428, 409, 337, 410, 433, 497, 530, 491, 202, 175, NA, 1, NA, 4, 5, 2, 4, 6, 54, 0, 0, 0, 0, 99, 365, 593, 607, 622, 662, 636, 653, 654, 648, 514, 632, 635, 401, 235, 322, 156, 1, 1, 0, 0, 0, 0, 0, 566, 449, 570, 477, 80, 197, 186, 381, 84, 106, 281, 236, 132, 52, 15, 62, 54, 71, 38, 62, 26, 0, 1, 8, 50, 574, 696, 682, 608, 637, 647, 579, 453, 477, 496, 475, 561, 362, 219, 226, 13, 374, 607, 624, 622, 620, 647, 672, 638, 638, 442, 575, 543, 417, 557, 496, 155, 1, 2, 4, 0, 1, 1, 3, 4, 4, 65, 64, 59,
+#> 65, 54, 53, 52, 4, 0, 0, 7, 31, 46, 44, 59, 7, 11, 6, 5, 0, 5, 5, 16, 8, 39, NA, 2, 0, 1, 6, 9, 6, 2, 3, 4, 4, 1, 92, 74, 53, 18, 10, 28, 44, 1, 0, 3, 0, 0, 0, 0, 0, 54, 454, 218, 477, 561, 581, 539, 605, 594, 175, 567, 623, 532, 129, 418, 334, 101, 164, 263, 153, 487, 539, 537, 606, 595, 564, 439, 584, 349, 199, 298, 486, 247, 183, 212, 352, 349, 603, 577, 466, 539, 545, 202, 12, 156, 223, 256, 49, 0, 13, 0, 2, 0, 0, 1, 0, 0, 0, 0, 0, 53, 75, 567, 512, 608, 474, 11, 226, 22, 27, 58, 74, 92, 64,
+#> 63, 0, 1, 4, 2, 31, 200, 390, 534, 414, 560, 210, 353, 13, 524, 399, 519, 107, 88, 2, 96, 608, 678, 536, 620, 611, 584, 427, 630, 590, 505, 243, 424, 169, 205, 494, 606, 486, 604, 509, 412, 309, 463, 548, 308, 15, 308, 508, 551, 597, 492, 598, 500, 573, 589, 419, 445, 218, 244, 213, 551, 379, 577, 550, 420, 30, 57, 45, 59, 70, 45, 26, 21, 30, 23, 35, 68, 77, 61, 0, 40, 7, 0, 49, 278, 20, 415, 303, 412, 448, 582, 601, 558, 549, 416, 541, 518, 525, 324, 518, 518, 528, 1, 0, 4, 3, 8, 6, 2, 7, 78, 42,
+#> 62, 35, 134, 439, 558, 670, 444, 73, 119, 191, 123, 414, 387, 473, 30, 162, 4, 129, 12, 545, 333, 358, 349, 556, 238, 12, 156, 79, 8, 411, 599, 570, 538, 184, 393, 531, 348, 444, 194, 206, 529, 545, 644, 628, 208, 286, 381, 193, 609, 601, 589, 451, 53, 440, 392, 31, 199, 215, 436, 557, 344, 550, 593, 624, 467, 513, 450, 316, 127, 32, 159, 520, 547, 572, 562, 266, 211, 377, 493, 540, 605, 561, 440, 50, 154, 418, 434, 587, 352, 384, 66, 217, 589, 620, 404, 635, 460, 261, 181, 195, 538, 510, 475, 587,
+#> 559, 598, 603, 620, 595, 556, 449, 589, 487, 604, 631, 549, 567, 298, 17, 36, 462, 357, 414, 442, 53, 22, 188, 497, 546, 576, 588, 572, 577, 574, 588, 209, 339, 605, 609, 563, 573, 502, 24, 195, 133, 390, 527, 558, 652, 587, 543, 477, 305, 266, 107, 193, 41, 173, 71, 7, 73, 144, 513, 524, 582, 570, 444, 563, 575, 566, 549, 438, 546, 548, 543, 533, 467, 208, 36, 368, 407, 375, 424, 287, 518, 252, 494, 466, 368, 452, 478, 248, 5, 19, 12, 56, 62, 60, 19, 23, 26, 56, 61, 66, 53, 66, 7, 6, 28, 32, 0,
+#> 1, 1, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 1, 2, 7, 5, 7, 6, 39, 6, 3, 3, 1, 3, 2, 0, 1, 4, 6, 62, 58, NA, 1, 1, 2, 6, 1, 62, 77, 71, 1, 5, 63, 72, 71, 6, 192, 474, 489, 461, 579, 517, 407, 551, 497, 398, 137, 123, 1, 221, 483, 448, 174, 467, 451, 463, 470, 365, 435, 423, 364, 112, 222, 47, 77, 39, 71, 73, 66, 64, 70, 49, 28, 29, 38, 0, 6, 0, 2, 0, 2, 1, 0, 0, 0, 0, 0, 0, 0, 1, 1, 0, 0, 0, 0, 0, 39, 312, 581, 529, 610, 616, 550, 557, 260, 286, 569, 467, 7, 132, 385, 411, 526, 387, 224, 58, 74, 23, 433,
+#> 271, 472, 376, 226, 456, 424, 375, 211, 133, 94, 18, 314, 603, 613, 576, 588, 616, 611, 548, 572, 622, 555, 611, 429, 492, 572, 558, 492, 623, 591, 618, 388, 236, 627, 436, 610, 605, 585, 258, 292, 2, 31, 38, 2, 72, 87, 78, 72, 59, 64, 22, 4, 42, 0, 32, 42, 16, 177, 282, 197, 264, 580, 343, 274, 603, 156, 325, 345, 259, 15, 376, 44, 97, 273, 128, 460, 641, 561, 563, 621, 611, 632, 230, 163, 66, 265, 317, 188, 517, 472, 642, 583, 655, 644, 623, 608, 621, 624, 593, 533, 555, 550, 539, 582, 207, 2,
+#> 386, 573, 666, 690, 668, 691, 639, 645, 541, 656, 631, 611, 51, 468, 14, 95, 65, 460, 580, 568, 186, 349, 445, 512, 445, 34, 139, 114, 220, 323, 564, 206, 342, 492, 503, 343, 158, 461, 587, 580, 618, 554, 469, 303, 377, 582, 608, 452, 566, 630, 500, 434, 64, 260, 503, 442, 1, 0, 13, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 50, 64, 62, 73, 73, 67, 2, 269, 657, 649, 193, 396, 488, 617, 539, 536, 481, 257, 528, 548, 453, 331, 110, 106, 280, 490, 592, 590, 623, 508, 296, 264, 505, 495, 77, 502, 168, NA, NA,
+#> 2, 22, NA, 5, 3, 5, 1, 2, 41, 57, 58, 55, 61, 50, 42, 5, 21, 10, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 1, 0, 0, 0, 0, 0, 0, 1, 4, 5, 2, 4, 4, 4, 2, 6, 0, 2, 633, 639, 589, 576, 543, 338, 251, 353, 304, 449, 401, 522, 482, 617, 597, 637, 626, 623, 627, 605, 595, 624, 14, 50, 200, 536, 490, 432, 544, 167, 335, 333, 107, 489, 521, 406, 536, 523, 510, 296, 545, 445, 455, 592, 134, 267, 543, 658, 530, 607, 571, 425, 398, 301, 476, 589, 124, 249, 180, 442, 504, 509, 488, 479, 466, 439, 356, 495, 465, 400, 479,
+#> 602, 636, 539, 346, 235, 596, 446, 599, 520, 574, 229, 2, 30, 75, 70, 80, 73, 81, 83, 69, 52, 44, 34, 274, 220, 696, 647, 681, 688, 147, 563, 537, 642, 382, 610, 193, 288, 263, 575, 582, 604, 626, 535, 587, 389, 581, 430, 535, 152, 93, 353, 577, 578, 538, 544, 468, 536, 561, 554, 460, 298, 106, 488, 81, 256, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 62, 273, 124, 452, 481, 260, 33, 490, 490, 471, 484, 493, 497, 277, 3, 59, 29, 333, 536, 373, 548, 540, 201, 562, 389, 469, 172, 460, 150, 4, 5, 6, 4, 6, 9,
+#> 3, 3, 48, 4, 5, 3, 5, 4, 2, 3, 33, 55, 59, 53, 60, 73, 49, 0, 23, 7, 1, 5, 9, 6, 0, 23, 36, 208, 79, 569, 528, 538, 491, 362, 431, 146, 292, 105, 138, 640, 655, 628, 634, 436, 128, 268, 185, 162, 98, 175, 415, 540, 553, 505, 331, 417, 422, 438, 379, 441, 257, 651, 642, 599, 304, 289, 401, 53, 601, 561, 183, 62, 24, 326, 123, 302, 157, 487, 578, 405, 612, 549, 499, 331, 331, 53, 656, 637, 628, 657, 677, 689, 716, 556, 672, 350, 567, 632, 600, 538, 517, 59, 569, 573, 588, 591, 578, 569, 581, 624, 150,
+#> 613, 4, 165, 240, 282, 575, 618, 559, 471, 392, 411, 470, 217, 265, 126, 242, 52, 99, NA, NA, NA, NA, NA, NA, 0, NA, 0, 0, 0, 0, 1, 0, 6, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 89, 520, 653, 626, 302, 635, 563, 641, 551, 381, 451, 611, 635, 619, 563, 598, 225, 530, 506, 60, 52, 4, 54, 14, 19, 2, NA, 2, 0, NA, 0, 0, 7, 0, 0, 0, 0, 0, 0, 0, 0, 2, 4, 2, 3, 64, 30, 18, 0, 49, 39, 44, 64, 76, 61, 67, 69, 69, 56, 62, 39, 3, 0, 0, 3, 8, 6, 5, 5, 5, 33,
+#> 3, 0, 75, 64, 60, 24, 2, 4, 1, 0, 0, 0, 0, 0, 0, 0, 0, 43, 70, 66, 67, 61, 45, 57, 44, 21, 42, 150, 570, 646, 616, 552, 591, 630, 484, 145, 583, 591, 571, 31, 370, 22, 9, 536, 650, 559, 584, 626, 610, 580, 606, 462, 588, 135, 385, 417, 353, 444, 481, 465, 475, 505, 505, 404, 488, 109, 270, 329, 597, 339, 168, 242, 267, 209, 57, 531, 139, 73, 17, 415, 456, 570, 620, 587, 519, 208, 387, 477, 123, 94, 84, 251, 56, 254, 603, 522, 232, 375, 547, 463, 594, 506, 554, 306, 465, 565, 570, 304, 494, 279, 196,
+#> 4, 0, 5, 3, 3, 5, 5, 6, 3, 2, 62, 448, 584, 574, 483, 273, 614, 624, 604, 1, 25, 54, 494, 331, 322, 421, 176, 148, 163, 42, 38, 187, 122, 411, 454, 636, 600, 575, 224, 230, 550, 598, 430, 106, 569, 521, 78, 298, 624, 336, 518, 487, 562, 576, 338, 170, 166, 229, 480, 351, 453, 421, 284, 276, 130, 81, 136, 26, 50, 41, 303, 538, 486, 209, 281, 112, 378, 422, 129, 357, 259, 630, 626, 644, 600, 584, 443, 606, 600, 506, 117, 435, 343, 181, 361, 546, 608, 205, 682, 528, 124, 396, 609, 327, 501, 313, 0,
+#> 0, 2, 2, 0, 1, 7, 6, 6, 49, 0, 33, 58, 60, 67, 74, 65, 477, 473, 581, 567, 648, 653, 644, 546, 0, 3, 6, 6, 3, 3, 4, 5, 6, 4, 5, 2, 67, 4, 0, 7, 58, 614, 653, 428, 610, 525, 395, 578, 568, 214, 346, 8, 119, 467, 606, 535, 227, 429, 624, 525, 444, 136, 289, 154, 292, 606, 606, 602, 602, 403, 263, 541, 596, 0, 6, 62, 60, 89, 84, 66, 71, 72, 10, 447, 393, 544, 572, 524, 233, 118, 42, 1, 3, 1, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 504, 358, 269, 93, 195, 385, 440, 60, 290, 326, 587, 569, 499, 321,
+#> 465, 290, 502, 396, 447, 525, 596, 517, 487, 556, 482, 341, 395, NA, 0, 0, 4, 3, 4, 2, 2, 2, 0, 0, 3, 2, 623, 584, 629, 172, 547, 337, 456, 482, 517, 95, 0, 5, 0, 5, 2, 2, 0, 3, 47, 45, 65, 4, 3, 8, 5, 3, 3, 65, 63, 76, 41, 12, 77, 69, 55, 38, 53, 38, 0, 4, 4, 1, 6, 2, 7, 3, 5, 2, 3, 1, 136, 271, 399, 565, 568, 322, 150, 145, 171, 302, 278, 587, 481, 518, 391, 260, 554, 21, 21, 6, 0, 6, 1, 81, 70, 61, 62, 68, 57, 63, 59, 27, 96, 609, 377, 543, 470, 537, 181, 446, 315, 323, 163, 11, 25, 40, 12, 28,
+#> 400, 532, 314, 56, 336, 569, 513, 332, 452, 553, 543, 84, 526, 469, 547, 599, 374, 581, 220, 545, 19, 25, 5, 250, 14, 173, 461, 559, 452, 73, 405, 476, 317, 202, 22, 28, 43, NA, NA, 1, 2, 3, 2, 3, 0, 0, 2, 8, 4, 2, 3, 2, 4, 4, 4, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 2, 0, 0, 0, 0, 17, 406, 162, 530, 520, 547, 557, 480, 542, 585, 614, 593, 637, 622, 583, 611, 632, 531, 564, 589, 600, 523, 448, 130, 11, 120, 40, 9, 58, 63, 68, 67, 57, 54, 4, 5, 130, 307, 115, 462, 399, 475, 585, 413, 613,
+#> 590, 31, 240, 333, 501, 462, 462, 424, 116, 554, 624, 78, 660, 303, 577, 575, 452, 29, 48, 55, 71, 58, 77, 63, 71, 354, 446, 500, 526, 523, 104, 258, 543, 493, 164, 242, 611, 642, 633, 563, 354, 491, 637, 595, 642, 629, 641, 420, 634, 642, 612, 40, 194, 346, 504, 534, 556, 517, 550, 589, 597, 455, 364, 445, 385, 601, 406, 123, 224, 323, 329, 443, 608, 595, 597, 614, 582, 549, 538, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 2, 1, 3, 0, 41, 0, 0, 0, 0, 0, 1, 61, 294, 464, 367, 330, 390, 178, 25, 162, 596, 612,
+#> 553, 631, 466, 583, 596, 214, 564, 580, 159, 352, 523, 381, 604, 555, 508, 378, 175, 505, 140, 356, 526, 495, 592, 554, 558, 566, 542, 0, 27, 0, 65, 13, 0, 1, 126, 645, 575, 395, 570, 168, 305, 574, 272, 62, 242, 174, 19, 460, 545, 414, 485, 458, 658, 459, 344, 568, 629, 145, 572, 563, 426, 396, 525, 588, 470, 0, 1, 0, 0, 0, 4, 0, 51, 59, 72, 6, 9, 3, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 3, 7, 4, 4, 6, 0, 4, 5, 4, 59, 62, 254, 611, 385, 363, 526, 372, 128, 592, 569, 414, 340, 527, 663, 601,
+#> 529, 411, 324, 451, 492, 563, 492, 212, 19, 324, 560, 151, 571, 511, 494, 429, 79, 529, 548, 501, 204, 33, 4, 23, 18, 331, 543, 610, 381, 604, 520, 191, 279, 580, 433, 570, 572, 593, 583, 548, 566, 520, 396, 587, 382, 573, 547, 36, 75, 455, 381, 365, 338, 517, 574, 632, 395, 377, 243, 488, 11, 123, 559, 589, 602, 575, 533, 424, 352, 521, 10, 22, 88, 381, 440, 487, 471, 460, 509, 472, 534, 504, 474, 464, 479, 503, 256, 82, 407, 25, 23, 502, 521, 351, 427, 370, 488, 519, 389, 73, 224, 0, 0, 413, 345,
+#> 509, 585, 560, 626, 493, 580, 20, 6, 47, 49, 60, 38, 82, 525, 584, 513, 600, 593, 583, 2, 0, 0, 0, 0, 0, 0, 0, 13, 53, 2, 4, 2, 3, 2, 69, 523, 535, 623, 503, 599, 191, 667, 327, 633, 148, 289, 496, 578, 531, 156, 514, 602, 406, 567, 486, 432, 616, 125, 577, 315, 291, 231, 415, 536, 574, 149, 286, 166, 606, 540, 535, 21, 29, 52, 335, 325, 225, 50, 16, 18, 295, 391, 120, 123, 76, 515, 584, 450, 573, 15, 296, 626, 595, 574, 347, 235, 525, 558, 398, 437, 18, 112, 102, 339, 422, 557, 547, 249, 588, 609,
+#> 529, 358, 489, 190, 379, 147, 22, 222, 399, 471, 551, 128, 337, 606, 524, 586, 0, 5, 54, 46, 28, 23, 5, 9, 31, 1, 4, 24, 355, 610, 546, 53, 265, 616, 110, 127, 0, 0, 2, 5, 6, 182, 594, 615, 590, 623, 20, 2, 3, 5, 60, 229, 404, 494, 564, 392, 416, 441, 240, 582, 476, 359, 516, 449, 425, 539, 279, 2, 39, 59, 68, 56, 66, 77, 556, 613, 46, 59, 221, 576, 626, 660, 638, 98, 293, 485, 363, 112, 297, 451, 552, 556, 611, 529, 36, 426, 596, 472, 478, 512, 543, 351, 613, 311, 4, 125, 506, 548, 605, 607, 579,
+#> 612, 18, 58, 65, 3, 4, 3, 0, 15, 39, 79, 0, 331, 505, 487, 529, 201, 399, 403, 230, 23, 195, 493, 630, 224, 303, 94, 609, 615, 81, 443, 265, 609, 167, 510, 495, 579, 196, 435, 499, 491, 507, 32, 274, 579, 608, 620, 131, 508, 391, 571, 658, 596, 499, 387, 559, 197, 119, 61, 566, 193, 484, 602, 154, 213, 569, 208, 395, 296, 441, 596, 44, 538, 613) x c(25, 32, 18, 32, 22, 35, 27, 0, 1, 21, 0, 9, 33, 47, 45, 62, 44, 42, 81, 64, 65, 73, 94, 94, 63, 80, 83, 84, 77, 41, 11, 25, 62, 59, 53, 48, 76, 89, 32, 42, 43, 1, 27, 30, 59, 48, 34, 30, 25, 6, 17, 20, 11, 8, 49, 44, 106, 167, 96, 123, 112, 112, 63, 4, 18, 24, 39, 27, 20, 26, 27, 10, 17, 18, 2, 0, 6, 10, 0, 16, 34, 21, 40, 20, 36, 18, 28, 7, 8, 18, 8, 15, 31, 30, 19, 32, 20, 14, 25, 23, 0, 60, 144, 161, 134, 125, 147, 160, 110, 97, 130, 97, 103, 27, 40, 10, 7, 0, 6, 23, 14, 23, 24, 20, 31, 14,
+#> 20, 22, 13, 20, 17, 21, 14, 8, 9, 10, 9, 6, 0, 0, 1, 36, 107, 113, 70, 95, 145, 81, 0, 90, 92, 29, 88, 53, 77, 56, 94, 36, 66, 66, 37, 40, 33, 0, 2, 6, 16, 0, 8, 4, 6, 4, 5, 4, 4, 2, 0, 1, 10, 10, 13, 15, 13, 6, 8, 11, 9, 9, 12, 14, 7, 8, 3, 1, 1, 60, 84, 72, 50, 60, 67, 82, 61, 49, 15, 43, 27, 85, 66, 71, 30, 58, 4, 61, 86, 25, 26, 103, 81, 62, 8, 50, 0, 15, 43, 39, 31, 26, 32, 41, 34, 33, 0, 12, 12, 15, 3, 1, 10, 36, 54, 36, 10, 29, 25, 37, 30, 40, 11, 10, 26, 9, 0, 0, 25, 68, 91, 92, 88, 49, 73,
+#> 65, 102, 102, 83, 83, 109, 81, 78, 74, 81, 41, 6, 0, 78, 91, 77, 89, 33, 60, 5, 5, 12, 7, 10, 5, 12, 23, 12, 1, 0, 0, 0, 1, 8, 8, 3, 6, 4, 6, 6, 3, 2, 11, 2, 0, 16, 16, 11, 12, 16, 5, 20, 5, 6, 6, 11, 3, 1, 0, 1, 19, 45, 97, 88, 116, 106, 147, 120, 70, 69, 144, 113, 107, 83, 92, 86, 124, 99, 103, 115, 97, 48, 104, 54, 0, 16, 19, 99, 81, 91, 70, 69, 71, 63, 57, 67, 64, 56, 59, 36, 47, 35, 39, 11, 3, 1, 0, 0, 3, 81, 74, 76, 61, 59, 61, 71, 42, 59, 19, 1, 0, 40, 30, 16, 87, 81, 58, 69, 57, 70, 27, 35,
+#> 22, 8, 20, 42, 19, 8, 26, 49, 67, 41, 26, 45, 44, 51, 31, 32, 8, 26, 20, 49, 40, 107, 30, 110, 42, 17, 124, 15, 71, 33, 3, 27, 1, 54, 96, 96, 120, 116, 122, 84, 118, 103, 88, 51, 95, 69, 97, 83, 97, 57, 73, 0, 0, 0, 4, 8, 6, 11, 6, 5, 13, 9, 8, 3, 2, 2, 4, 10, 2, 6, 3, 3, 6, 6, 8, 3, 6, 2, 1, 37, 80, 98, 107, 101, 105, 97, 97, 114, 103, 98, 100, 92, 90, 87, 91, 51, 60, 68, 45, 15, 23, 35, 64, 125, 106, 115, 77, 66, 88, 79, 76, 84, 61, 83, 101, 43, 52, 7, 70, 49, 44, 65, 66, 83, 88, 87, 29, 73, 81,
+#> 81, 38, 33, 5, 20, 0, 0, 9, 14, 8, 8, 10, 9, 9, 12, 5, 3, 9, 6, 5, 6, 4, 4, 10, 3, 4, 6, 3, 1, 1, 3, 3, 3, 1, 16, 67, 77, 44, 42, 57, 93, 105, 90, 85, 54, 66, 31, 12, 21, 11, 35, 2, 0, 39, 104, 81, 92, 137, 125, 122, 118, 87, 91, 51, 87, 117, 79, 92, 89, 108, 80, 66, 50, 3, 0, 1, 5, 13, 25, 36, 29, 34, 17, 18, 10, 7, 1, 0, 0, 8, 31, 25, 13, 16, 4, 0, 0, 12, 73, 92, 88, 136, 94, 101, 108, 102, 90, 73, 83, 137, 107, 85, 133, 94, 79, 96, 71, 28, 10, 15, 18, 9, 12, 6, 9, 4, 5, 6, 7, 5, 8, 6, 7, 3, 0,
+#> 3, 7, 6, 14, 18, 16, 12, 23, 14, 13, 15, 10, 13, 6, 10, 8, 11, 18, 12, 6, 6, 20, 11, 14, 15, 13, 16, 13, 13, 15, 4, 13, 1, 4, 11, 0, 1, 4, 9, 15, 16, 10, 2, 6, 1, 41, 30, 25, 32, 74, 13, 114, 90, 126, 107, 98, 97, 99, 73, 112, 74, 82, 85, 72, 15, 17, 6, 14, 8, 28, 37, 42, 53, 32, 23, 6, 19, 28, 4, 1, 0, 0, 1, 0, 9, 9, 5, 13, 8, 4, 1, 0, 2, 4, 7, 6, 5, 1, 3, 1, 32, 37, 26, 38, 39, 83, 89, 92, 103, 58, 65, 53, 54, 23, 2, 3, 0, 0, 75, 20, 64, 97, 97, 92, 71, 66, 102, 93, 126, 83, 60, 50, 24, 99, 80,
+#> 42, 14, 1, 0, 2, 4, 8, 6, 5, 7, 0, 4, 5, 0, 1, 7, 43, 30, 67, 55, 60, 83, 66, 28, 7, 11, 65, 29, 2, 0, 12, 20, 6, 22, 14, 33, 14, 3, 0, 0, 4, 19, 25, 17, 37, 35, 25, 12, 0, 9, 4, 24, 4, 20, 31, 10, 1, 0, 8, 2, 4, 6, 0, 10, 8, 11, 9, 10, 5, 6, 6, 9, 5, 7, 4, 7, 2, 3, 0, 1, 6, 31, 36, 41, 35, 38, 17, 21, 11, 0, 3, 2, 4, 51, 100, 77, 75, 79, 60, 110, 79, 79, 92, 96, 72, 44, 24, 17, 46, 11, 1, 7, 7, 0, 2, 0, 0, 5, 73, 83, 96, 116, 116, 84, 46, 57, 65, 70, 46, 30, 0, 17, 24, 45, 35, 19, 16, 27, 16, 19,
+#> 9, 9, 12, 0, 5, 3, 3, 0, 5, 2, 0, 3, 1, 0, 3, 15, 126, 121, 109, 61, 21, 42, 91, 91, 9, 79, 105, 20, 18, 41, 45, 25, 18, 28, 42, 30, 18, 20, 6, 10, 2, 9, 1, 15, 25, 48, 60, 37, 33, 24, 21, 8, 5, 12, 7, 9, 18, 9, 10, 17, 1, 6, 9, 8, 4, 10, 3, 7, 1, 1, 7, 13, 2, 0, 67, 89, 81, 76, 89, 62, 75, 59, 50, 79, 97, 69, 114, 63, 47, 16, 65, 86, 97, 102, 98, 67, 87, 86, 6, 55, 48, 38, 61, 48, 1, 7, 39, 61, 71, 50, 43, 94, 37, 98, 83, 46, 6, 4, 0, 3, 1, 9, 14, 5, 3, 0, 3, 3, 6, 0, 1, 2, 3, 3, 4, 0, 3, 4, 10,
+#> 76, 83, 79, 74, 44, 42, 50, 40, 32, 50, 72, 58, 70, 57, 19, 12, 0, 0, 7, 55, 80, 88, 64, 50, 51, 47, 53, 50, 67, 72, 101, 74, 4, 3, 4, 12, 22, 26, 11, 13, 11, 38, 22, 42, 19, 6, 5, 46, 0, 22, 0, 4, 1, 29, 62, 53, 61, 34, 75, 43, 38, 2, 0, 0, 17, 23, 35, 80, 95, 69, 75, 65, 54, 22, 61, 43, 56, 10, 40, 49, 63, 96, 102, 83, 59, 51, 82, 78, 69, 21, 57, 8, 47, 64, 59, 72, 80, 71, 64, 33, 30, 1, 7, 9, 9, 8, 4, 2, 32, 44, 64, 41, 41, 36, 43, 58, 77, 46, 39, 46, 17, 36, 40, 41, 43, 16, 9, 3, 4, 10, 7, 3,
+#> 3, 2, 6, 1, 0, 5, 1, 2, 1, 13, 56, 64, 73, 75, 62, 57, 30, 16, 28, 45, 13, 8, 86, 52, 56, 12, 43, 7, 0, 63, 78, 76, 89, 70, 70, 43, 34, 2, 15, 78, 55, 70, 64, 66, 64, 76, 38, 39, 70, 89, 91, 92, 63, 92, 125, 68, 34, 7, 38, 30, 46, 36, 48, 35, 57, 64, 32, 57, 42, 15, 44, 26, 2, 0, 0, 9, 3, 8, 2, 5, 2, 2, 2, 6, 2, 6, 8, 68, 74, 51, 79, 69, 3, 44, 48, 90, 115, 78, 62, 37, 32, 0, 40, 87, 85, 69, 67, 46, 3, 4, 38, 25, 24, 26, 30, 37, 35, 30, 32, 20, 24, 10, 21, 6, 0, 0, 2, 11, 81, 100, 83, 105, 103, 80,
+#> 86, 115, 111, 104, 99, 43, 65, 5, 9, 4, 0, 33, 78, 77, 18, 46, 43, 7, 6, 5, 0, 3, 3, 3, 2, 1, 8, 51, 0, 59, 72, 85, 91, 86, 79, 86, 54, 63, 91, 82, 7, 2, 2, 2, 1, 19, 41, 23, 18, 5, 7, 7, 26, 36, 34, 37, 37, 21, 10, 7, 85, 53, 56, 69, 45, 79, 23, 121, 117, 80, 49, 75, 70, 44, 47, 35, 0, 42, 74, 94, 87, 74, 60, 5, 19, 3, 17, 12, 59, 55, 53, 49, 54, 88, 67, 98, 98, 101, 78, 63, 86, 31, 11, 1, 0, 4, 3, 13, 3, 0, 5, 5, 2, 2, 0, 2, 28, 83, 60, 69, 96, 137, 125, 134, 94, 100, 78, 87, 71, 1, 67, 54, 1,
+#> 16, 18, 14, 50, 103, 158, 177, 94, 151, 143, 61, 139, 158, 163, 121, 150, 149, 120, 97, 78, 13, 38, 16, 51, 53, 37, 72, 46, 54, 61, 30, 40, 69, 57, 27, 15, 39, 5, 63, 86, 51, 68, 96, 131, 141, 89, 121, 133, 96, 133, 99, 156, 15, 64, 10, 2, 9, 2, 1, 1, 7, 1, 9, 1, 16, 0, 42, 27, 32, 12, 18, 14, 17, 23, 5, 13, 25, 14, 1, 0, 0, 25, 72, 88, 64, 8, 0, 68, 7, 29, 5, 55, 51, 64, 83, 78, 64, 37, 89, 102, 65, 73, 75, 16, 68, 88, 1, 10, 4, 9, 7, 1, 10, 7, 5, 10, 6, 6, 6, 5, 10, 29, 78, 59, 101, 50, 98, 84,
+#> 75, 97, 0, 14, 3, 18, 25, 27, 26, 22, 28, 30, 17, 16, 11, 2, 26, 73, 34, 4, 82, 61, 73, 81, 68, 29, 88, 67, 91, 95, 83, 20, 76, 46, 2, 77, 114, 99, 76, 76, 90, 82, 70, 41, 74, 85, 140, 120, 113, 109, 18, 46, 70, 41, 2, 0, 2, 5, 1, 4, 8, 8, 9, 11, 11, 18, 9, 11, 12, 2, 0, 1, 17, 19, 28, 32, 30, 21, 34, 46, 63, 39, 33, 31, 29, 7, 14, 4, 29, 81, 93, 98, 100, 85, 90, 75, 89, 81, 76, 91, 74, 111, 87, 107, 62, 0, 6, 4, 3, 2, 3, 10, 8, 4, 7, 13, 5, 14, 2, 72, 51, 53, 71, 90, 46, 28, 41, 72, 69, 68, 58,
+#> 42, 56, 49, 56, 46, 57, 15, 1, 7, 5, 8, 9, 10, 15, 15, 11, 12, 4, 10, 17, 11, 3, 9, 4, 4, 1, 1, 0, 0, 0, 1, 18, 1, 35, 55, 67, 65, 63, 59, 89, 109, 128, 62, 73, 72, 67, 19, 23, 2, 52, 37, 61, 76, 62, 56, 85, 96, 85, 63, 66, 98, 0, 1, 2, 35, 69, 54, 37, 36, 62, 83, 51, 82, 29, 12, 1, 0, 1, 1, 1, 4, 1, 14, 10, 8, 9, 2, 0, 6, 11, 3, 1, 0, 26, 77, 3, 80, 83, 83, 91, 117, 106, 111, 98, 98, 95, 119, 121, 81, 58, 19, 48, 0, 12, 12, 5, 8, 17, 8, 4, 3, 0, 8, 1, 6, 10, 13, 3, 4, 9, 3, 3, 8, 1, 1, 2, 0, 1,
+#> 2, 8, 18, 14, 9, 11, 12, 6, 6, 0, 66, 25, 37, 40, 40, 41, 41, 65, 64, 48, 56, 3, 10, 15, 1, 16, 9, 31, 23, 22, 30, 21, 39, 16, 9, 5, 70, 73, 92, 90, 105, 121, 112, 82, 62, 3, 11, 4, 1, 1, 8, 10, 8, 8, 7, 6, 3, 7, 2, 3, 8, 4, 4, 0, 0, 3, 8, 9, 10, 3, 6, 10, 18, 7, 2, 9, 3, 12, 5, 5, 3, 21, 57, 121, 101, 116, 121, 89, 75, 112, 107, 93, 121, 96, 59, 74, 74, 52, 40, 3, 2, 4, 0, 2, 12, 69, 95, 96, 82, 91, 87, 70, 27, 46, 73, 22, 18, 23, 17, 46, 47, 61, 78, 100, 113, 79, 42, 31, 15, 1, 4, 8, 8, 6, 5, 11,
+#> 9, 9, 5, 11, 5, 0, 0, 0, 1, 4, 3, 9, 26, 25, 65, 54, 45, 44, 111, 105, 50, 39, 44, 33, 14, 1, 1, 8, 6, 2, 4, 9, 8, 1, 14, 19, 15, 12, 13, 10, 5, 1, 0, 0, 0, 8, 9, 3, 13, 4, 7, 6, 4, 5, 2, 8, 6, 5, 3, 3, 2, 3, 6, 3, 3, 6, 7, 8, 7, 10, 8, 6, 4, 4, 2, 6, 0, 2, 2, 3, 1, 0, 8, 3, 12, 12, 6, 5, 18, 2, 6, 7, 3, 59, 70, 82, 48, 74, 109, 96, 96, 79, 88, 19, 72, 49, 30, 2, 1, 9, 22, 40, 58, 58, 53, 31, 21, 14, 11, 1, 4, 1, 3, 0, 25, 57, 57, 34, 74, 66, 114, 92, 121, 107, 97, 90, 106, 83, 86, 79, 3, 7, 4, 21,
+#> 21, 23, 10, 10, 16, 4, 9, 18, 15, 8, 2, 0, 1, 1, 1, 1, 0, 1, 3, 6, 4, 9, 6, 4, 14, 6, 4, 2, 5, 6, 0, 1, 14, 101, 80, 98, 99, 78, 91, 83, 79, 90, 44, 102, 95, 87, 0, 11, 6, 38, 62, 64, 78, 53, 73, 58, 68, 67, 66, 58, 65, 66, 38, 24, 0, 13, 0, 0, 1, 9, 11, 29, 32, 68, 73, 25, 2, 37, 63, 19, 23, 6, 35, 37, 11, 7, 16, 3, 10, 0, 0, 0, 5, 3, 6, 7, 9, 8, 7, 7, 8, 8, 8, 10, 8, 1, 1, 0, 0, 0, 1, 6, 7, 9, 3, 4, 1, 0, 5, 1, 0, 0, 0, 9, 5, 7, 8, 2, 10, 7, 4, 4, 6, 2, 1, 1, 1, 1, 7, 42, 62, 56, 83, 103, 87, 84,
+#> 56, 71, 65, 70, 68, 78, 83, 83, 11, 45, 20, 7, 3, 0, 5, 37, 41, 45, 43, 40, 20, 19, 9, 16, 41, 4, 50, 3, 69, 94, 87, 130, 98, 109, 89, 73, 63, 56, 64, 7, 0, 10, 0, 15, 2, 5, 11, 3, 8, 7, 4, 1, 0, 7, 1, 1, 0, 2, 7, 7, 9, 5, 11, 13, 6, 8, 6, 1, 4, 5, 8, 4, 0, 2, 1, 45, 81, 51, 64, 67, 73, 92, 70, 65, 23, 11, 75, 74, 41, 6, 0, 89, 108, 86, 114, 83, 93, 91, 94, 90, 81, 74, 85, 62, 24, 3, 4, 28, 56, 61, 35, 56, 61, 2, 84, 53, 52, 55, 58, 67, 49, 47, 40, 36, 3, 20, 5, 48, 59, 77, 69, 71, 78, 35, 64, 82,
+#> 64, 63, 39, 44, 43, 12, 25, 5, 0, 1, 0, 18, 30, 41, 34, 63, 50, 55, 42, 61, 31, 16, 18, 6, 1, 10, 13, 4, 69, 50, 80, 92, 113, 110, 87, 118, 104, 74, 93, 24, 27, 69, 122, 90, 86, 78, 114, 152, 105, 144, 85, 102, 68, 96, 60, 79, 39, 0, 7, 1, 9, 1, 8, 44, 86, 100, 116, 105, 96, 80, 82, 81, 34, 114, 88, 97, 106, 88, 122, 30, 6, 0, 10, 6, 7, 16, 10, 7, 20, 6, 11, 11, 9, 5, 2, 6, 9, 5, 4, 8, 10, 0, 0, 0, 4, 94, 144, 113, 60, 92, 111, 155, 110, 58, 37, 80, 22, 36, 96, 48, 45, 80, 97, 73, 78, 63, 4, 83,
+#> 36, 50, 19, 1, 29, 79, 87, 92, 98, 95, 123, 108, 92, 73, 45, 57, 72, 44, 72, 11, 5, 20, 35, 29, 22, 2, 1, 12, 34, 29, 16, 8, 3, 9, 0, 3, 4, 5, 4, 13, 8, 1, 3, 1, 0, 2, 0, 0, 0, 55, 49, 60, 42, 61, 63, 7, 1, 52, 71, 91, 64, 69, 97, 84, 29, 1, 0, 5, 57, 58, 82, 63, 85, 70, 72, 49, 9, 68, 76, 59, 52, 2, 59, 83, 46, 95, 102, 104, 85, 26, 74, 110, 121, 115, 88, 68, 43, 57, 9, 2, 0, 4, 43, 74, 91, 75, 135, 120, 3, 69, 4, 3, 6, 8, 10, 13, 11, 8, 10, 9, 4, 5, 5, 6, 8, 3, 4, 6, 6, 9, 14, 3, 4, 4, 8, 8, 1,
+#> 0, 0, 62, 28, 97, 119, 89, 135, 146, 66, 77, 41, 24, 0, 0, 0, 3, 3, 3, 10, 0, 6, 9, 13, 1, 4, 1, 4, 1, 0, 5, 6, 3, 5, 2, 1, 1, 6, 2, 73, 135, 149, 139, 127, 143, 163, 138, 138, 128, 125, 167, 138, 115, 2, 79, 92, 62, 101, 109, 67, 79, 94, 59, 72, 82, 56, 21, 6, 7, 0, 1, 3, 8, 4, 7, 8, 5, 4, 10, 15, 9, 2, 0, 1, 5, 0, 1, 1, 2, 4, 4, 1, 1, 0, 5, 5, 9, 9, 3, 9, 2, 4, 5, 2, 0, 0, 4, 0, 0, 1, 8, 15, 5, 8, 4, 7, 4, 1, 3, 8, 1, 7, 2, 4, 4, 4, 0, 6, 9, 6, 8, 3, 8, 4, 6, 4, 5, 3, 3, 1, 1, 1, 2, 3, 3, 101,
+#> 114, 142, 131, 117, 88, 107, 101, 122, 98, 107, 94, 77, 62, 32, 5, 40, 43, 29, 16, 1, 0, 1, 26, 75, 26, 101, 100, 103, 139, 121, 124, 68, 109, 91, 36, 27, 32, 42, 40, 50, 11, 45, 59, 54, 45, 36, 34, 25, 38, 25, 15, 0, 0, 2, 133, 121, 134, 32, 90, 90, 59, 95, 83, 67, 80, 79, 49, 30, 7, 17, 2, 23, 3, 2, 5, 5, 3, 1, 11, 6, 2, 6, 5, 11, 7, 1, 1, 6, 1, 0, 8, 6, 2, 5, 4, 4, 6, 3, 1, 4, 12, 2, 1, 2, 2, 8, 4, 0, 1, 10, 36, 30, 62, 101, 101, 108, 94, 34, 77, 75, 10, 39, 7, 1, 4, 2, 11, 13, 4, 12, 9, 9, 10,
+#> 5, 3, 3, 2, 0, 1, 19, 43, 90, 107, 99, 99, 127, 38, 83, 70, 59, 49, 12, 38, 55, 33, 5, 78, 60, 38, 97, 20, 65, 21, 0, 8, 2, 3, 62, 110, 108, 131, 144, 67, 112, 103, 134, 123, 144, 133, 133, 86, 108, 65, 6, 13, 4, 81, 88, 66, 50, 68, 93, 54, 61, 39, 76, 69, 48, 71, 49, 52, 45, 62, 10, 9, 0, 10, 117, 113, 137, 118, 119, 129, 120, 143, 86, 47, 47, 3, 6, 11, 12, 10, 5, 5, 4, 1, 4, 0, 1, 4, 6, 6, 6, 8, 3, 9, 2, 4, 0, 0, 12, 19, 24, 14, 26, 12, 25, 20, 7, 7, 1, 6, 0, 0, 2, 3, 78, 82, 94, 87, 83, 2, 47,
+#> 3, 18, 32, 51, 74, 19, 5, 13, 0, 8, 8, 12, 12, 7, 5, 2, 0, 4, 0, 0, 5, 1, 15, 14, 8, 15, 18, 15, 13, 14, 11, 6, 11, 8, 1, 3, 6, 5, 9, 11, 6, 9, 15, 9, 4, 3, 3, 5, 5, 2, 0, 2, 2, 0, 2, 67, 152, 122, 85, 120, 14, 31, 27, 2, 8, 23, 85, 123, 127, 93, 151, 125, 120, 118, 130, 111, 139, 130, 106, 87, 18, 25, 0, 30, 110, 102, 140, 116, 83, 128, 109, 136, 121, 101, 8, 58, 10, 2, 9, 2, 23, 72, 127, 103, 95, 89, 68, 70, 36, 102, 98, 97, 104, 98, 7, 8, 24, 1, 0, 0, 2, 8, 5, 3, 6, 3, 8, 3, 2, 0, 3, 54, 45, 9,
+#> 57, 62, 88, 71, 50, 54, 45, 8, 39, 8, 0, 1, 0, 6, 0, 14, 10, 11, 5, 6, 8, 4, 2, 3, 1, 7, 5, 7, 3, 11, 9, 9, 14, 5, 7, 5, 5, 2, 8, 5, 0, 6, 3, 7, 2, 8, 10, 4, 2, 4, 4, 2, 3, 3, 3, 6, 7, 5, 15, 16, 10, 3, 12, 2, 4, 2, 2, 8, 7, 6, 1, 0, 0, 41, 126, 158, 121, 152, 101, 78, 71, 19, 83, 74, 53, 8, 37, 39, 6, 0, 0, 1, 1, 8, 9, 3, 8, 4, 1, 8, 5, 3, 0, 5, 4, 0, 0, 3, 8, 9, 12, 9, 9, 10, 5, 4, 6, 6, 1, 2, 2, 1, 14, 102, 82, 79, 113, 101, 106, 86, 111, 77, 77, 4, 76, 76, 24, 32, 3, 2, 0, 4, 10, 5, 8, 9, 1,
+#> 1, 1, 1, 5, 2, 0, 1, 10, 8, 15, 18, 7, 8, 3, 4, 2, 0, 0, 0, 27, 101, 69, 88, 118, 78, 102, 60, 71, 91, 67, 37, 76, 0, 44, 53, 48, 0, 1, 60, 55, 65, 66, 58, 56, 54, 99, 87, 84, 98, 45, 35, 28, 29, 10, 1, 85, 89, 69, 89, 88, 77, 57, 70, 79, 65, 62, 79, 18, 2, 9, 59, 60, 75, 77, 88, 93, 90, 93, 78, 68, 17, 51, 52, 7, 3, 14, 2, 11, 7, 6, 4, 4, 10, 3, 7, 9, 7, 12, 10, 8, 6, 0, 1, 1, 4, 5, 5, 7, 9, 10, 9, 5, 11, 5, 2, 5, 4, 0, 1, 98, 94, 90, 84, 92, 91, 88, 14, 40, 74, 5, 36, 0, 3, 0, 60, 38, 44, 39, 58,
+#> 50, 46, 31, 19, 32, 20, 15, 33, 17, 40, 27, 22, 13, 9, 13, 92, 110, 132, 115, 111, 100, 98, 62, 21, 100, 69, 13, 41, 64, 17, 14, 7, 19, 0, 1, 3, 2, 5, 4, 7, 3, 9, 5, 4, 3, 0, 0, 71, 85, 115, 108, 122, 71, 88, 94, 113, 69, 82, 112, 24, 19, 5, 64, 0, 129, 84, 89, 85, 92, 115, 105, 56, 51, 6, 15, 19, 16, 2, 1, 7, 7, 10, 2, 0, 14, 4, 9, 3, 1, 0, 0, 8, 7, 11, 2, 9, 11, 3, 5, 3, 8, 4, 1, 3, 2, 9, 0, 1, 2, 20, 82, 77, 81, 53, 15, 2, 17, 51, 25, 7, 23, 69, 138, 122, 104, 119, 98, 119, 113, 120, 99, 116,
+#> 85, 89, 89, 118, 65, 91, 73, 2, 0, 1, 0, 53, 56, 106, 108, 110, 89, 76, 80, 83, 47, 1, 3, 8, 19, 8, 9, 9, 12, 4, 11, 6, 10, 0, 0, 59, 118, 121, 10, 137, 144, 112, 129, 12, 47, 91, 71, 0, 12, 37, 73, 109, 99, 96, 99, 90, 116, 110, 94, 93, 71, 79, 69, 62, 26, 21, 1, 1, 80, 106, 53, 71, 93, 76, 81, 121, 89, 45, 0, 2, 82, 101, 116, 46, 116, 91, 69, 49, 38, 42, 54, 70, 21, 11, 5, 68, 47, 122, 74, 121, 121, 60, 34, 48, 28, 15, 35, 77, 79, 52, 72, 48, 84, 22, 4, 132, 151, 129, 108, 93, 122, 123, 81, 97,
+#> 110, 58, 114, 72, 0, 5, 12, 12, 10, 0, 9, 12, 2, 1, 3, 8, 1, 3, 1, 1, 5, 7, 2, 12, 12, 5, 12, 10, 3, 0, 6, 3, 2, 1, 2, 60, 98, 113, 86, 68, 91, 78, 73, 82, 82, 79, 23, 20, 32, 26, 49, 47, 17, 2, 36, 66, 90, 75, 94, 111, 98, 41, 82, 96, 93, 78, 63, 12, 59, 67, 63, 82, 11, 32, 10, 54, 75, 102, 106, 109, 112, 101, 111, 91, 78, 65, 110, 55, 28, 93, 26, 78, 72, 67, 68, 111, 69, 82, 21, 23, 4, 4, 11, 8, 7, 7, 8, 4, 5, 1, 7, 6, 5, 0, 5, 5, 0, 3, 5, 6, 11, 4, 0, 7, 2, 2, 2, 0, 7, 7, 2, 6, 2, 0, 0, 3, 0,
+#> 1, 1, 2, 11, 1, 0, 6, 1, 73, 89, 87, 64, 93, 42, 12, 58, 41, 1, 44, 56, 27, 9, 6, 4, 0, 0, 0, 0, 76, 103, 85, 104, 111, 67, 97, 70, 137, 110, 59, 4, 43, 37, 9, 6, 4, 68, 60, 93, 104, 63, 68, 68, 20, 3, 18, 5, 4, 10, 5, 5, 7, 2, 0, 0, 2, 1, 0, 0, 54, 108, 116, 143, 132, 139, 102, 106, 42, 0, 6, 8, 5, 12, 9, 2, 15, 14, 20, 10, 11, 13, 14, 11, 12, 12, 8, 10, 8, 4, 1, 2, 14, 31, 45, 28, 3, 27, 9, 7, 47, 57, 43, 30, 27, 58, 46, 29, 7, 12, 12, 23, 7, 0, 6, 8, 104, 64, 55, 89, 82, 58, 20, 60, 46, 23, 81,
+#> 64, 17, 0, 0, 0, 6, 0, 6, 11, 9, 2, 9, 6, 0, 9, 3, 0, 5, 4, 0, 0, 4, 3, 0, 5, 0, 1, 2, 0, 0, 1, 2, 6, 1, 6, 6, 7, 9, 6, 3, 6, 5, 1, 0, 1, 5, 89, 99, 93, 77, 58, 56, 85, 68, 46, 24, 7, 14, 20, 43, 30, 42, 36, 42, 41, 60, 43, 50, 33, 32, 19, 37, 46, 19, 8, 0, 8, 16, 3, 30, 59, 79, 65, 58, 45, 6, 8, 5, 4, 10, 3, 4, 8, 2, 3, 0, 5, 0, 1, 0, 0, 86, 81, 86, 103, 85, 78, 14, 21, 31, 24, 83, 92, 112, 104, 88, 82, 35, 89, 96, 74, 59, 103, 111, 103, 91, 91, 114, 115, 93, 98, 78, 65, 106, 71, 2, 1, 6, 14, 7,
+#> 11, 2, 9, 8, 1, 7, 7, 10, 5, 3, 6, 0, 0, 1, 3, 1, 1, 10, 2, 6, 1, 1, 0, 6, 9, 2, 4, 1, 4, 0, 1, 0, 0, 131, 134, 135, 141, 142, 125, 124, 150, 82, 109, 2, 17, 93, 77, 71, 96, 81, 32, 56, 2, 8, 27, 10, 36, 14, 12, 15, 10, 6, 16, 11, 6, 13, 11, 9, 11, 6, 3, 1, 0, 9, 4, 6, 4, 6, 8, 10, 3, 0, 5, 4, 5, 3, 3, 0, 25, 77, 88, 63, 33, 76, 95, 102, 78, 66, 78, 46, 4, 10, 6, 1, 41, 27, 21, 64, 68, 93, 56, 75, 36, 6, 1, 17, 110, 44, 24, 50, 65, 68, 20, 11, 104, 101, 145, 103, 119, 90, 92, 108, 108, 43, 4, 4,
+#> 49, 0, 24, 59, 24, 56, 66, 73, 66, 8, 14, 16, 62, 39, 12, 15, 11, 0, 87, 102, 102, 106, 97, 26, 98, 36, 41, 17, 7, 6, 0, 2, 37, 78, 74, 83, 95, 116, 82, 36, 69, 68, 42, 3, 23, 17, 12, 0, 3, 32, 78, 54, 47, 49, 48, 46, 30, 69, 45, 21, 17, 8, 76, 73, 65, 56, 57, 58, 53, 27, 2, 1, 6, 3, 5, 14, 8, 7, 7, 0, 1, 2, 6, 0, 0, 1, 3, 3, 2, 7, 48, 85, 77, 72, 96, 55, 60, 106, 4, 45, 10, 8, 17, 52, 88, 106, 101, 106, 105, 92, 92, 89, 56, 24, 86, 50, 88, 56, 81, 75, 6, 23, 0, 3, 0, 7, 5, 0, 1, 2, 0, 2, 1, 8, 10,
+#> 5, 7, 1, 1, 1, 6, 5, 5, 2, 0, 0, 0, 0, 10, 4, 6, 1, 1, 2, 6, 0, 2, 3, 2, 85, 33, 34, 117, 89, 75, 68, 17, 32, 12, 22, 7, 0, 0, 0, 5, 5, 6, 2, 2, 5, 0, 6, 4, 0, 0, 0, 59, 95, 96, 71, 100, 100, 100, 91, 92, 82, 48, 73, 64, 19, 49, 1, 37, 15, 24, 21, 0, 10, 34, 40, 49, 43, 69, 51, 53, 53, 84, 23, 50, 45, 46, 28, 22, 26, 5, 79, 71, 49, 72, 59, 59, 80, 0, 86, 84, 67, 83, 72, 47, 74, 47, 49, 91, 35, 2, 1, 8, 5, 6, 5, 3, 0, 1, 3, 1, 4, 5, 5, 6, 4, 4, 2, 0, 10, 10, 8, 5, 6, 7, 2, 6, 2, 3, 0, 4, 3, 0, 3,
+#> 8, 3, 0, 0, 2, 10, 2, 5, 4, 6, 9, 0, 1, 9, 5, 5, 22, 94, 72, 83, 83, 62, 71, 3, 46, 0, 84, 75, 91, 90, 67, 74, 114, 113, 125, 62, 35, 14, 16, 31, 0, 10, 0, 4, 5, 4, 6, 7, 9, 5, 2, 5, 0, 3, 0, 5, 1, 2, 1, 0, 0, 6, 2, 1, 0, 0, 44, 50, 66, 38, 50, 63, 51, 57, 70, 61, 36, 16, 0, 17, 45, 32, 27, 32, 53, 31, 43, 5, 15, 22, 10, 6, 105, 115, 106, 124, 111, 112, 93, 10, 26, 43, 5, 17, 0, 72, 85, 66, 105, 91, 81, 90, 77, 71, 78, 16, 40, 4, 70, 51, 67, 59, 48, 44, 5, 52, 23, 0, 7, 4, 5, 9, 9, 18, 11, 7, 5,
+#> 6, 2, 6, 6, 3, 1, 0, 0, 4, 11, 1, 2, 0, 12, 8, 4, 3, 1, 2, 0, 91, 53, 64, 59, 50, 17, 0, 0, 8, 87, 108, 112, 124, 113, 135, 128, 105, 124, 105, 127, 120, 97, 87, 82, 64, 37, 49, 46, 57, 34, 0, 0, 5, 14, 12, 9, 9, 10, 10, 4, 2, 5, 1, 3, 19, 58, 52, 56, 3, 29, 79, 40, 34, 14, 52, 3, 42, 33, 12, 21, 0, 11, 5, 7, 56, 71, 1, 2, 59, 73, 57, 64, 41, 64, 2, 1, 34, 125, 107, 75, 102, 90, 29, 0, 32, 10, 0, 0, 3, 3, 1, 4, 10, 9, 6, 5, 6, 8, 6, 4, 5, 1, 0, 0, 18, 88, 74, 75, 82, 85, 80, 50, 93, 99, 77, 94, 73,
+#> 33, 24, 19, 37, 69, 87, 85, 43, 0, 0, 51, 59, 44, 0, 50, 37, 14, 38, 1, 7, 0, 0, 8, 4, 3, 3, 0, 2, 1, 0, 22, 70, 75, 87, 74, 71, 78, 95, 95, 79, 94, 91, 103, 60, 1, 68, 2, 1, 12, 3, 105, 84, 27, 30, 75, 88, 57, 83, 77, 102, 80, 77, 39, 26, 6, 20, 78, 37, 78, 88, 77, 37, 5, 64, 67, 76, 58, 59, 49, 68, 77, 62, 42, 14, 26, 8, 0, 5, 5, 50, 0, 4, 10, 0, 31, 32, 24, 26, 13, 16, 12, 11, 4, 1, 0, 1, 2, 2, 11, 8, 4, 1, 3, 2, 1, 2, 2, 0, 0, 6, 10, 3, 0, 0, 4, 4, 6, 2, 2, 0, 0, 12, 31, 8, 41, 82, 16, 15, 30,
+#> 66, 98, 3, 80, 63, 82, 5, 85, 55, 43, 29, 4, 34, 46, 59, 93, 106, 94, 89, 56, 41, 46, 49, 24, 7, 3, 21, 1, 1, 51, 69, 95, 84, 76, 108, 34, 0, 7, 47, 64, 18, 68, 82, 79, 95, 42, 26, 76, 70, 61, 29, 15, 31, 17, 17, 0, 4, 8, 1, 2, 5, 4, 8, 8, 4, 3, 1, 4, 2, 5, 5, 5, 9, 5, 4, 2, 1, 0, 1, 0, 56, 75, 93, 125, 80, 90, 85, 47, 44, 1, 2, 0, 1, 0, 0, 2, 5, 1, 1, 1, 6, 0, 0, 1, 3, 11, 6, 4, 3, 4, 1, 0, 10, 75, 22, 38, 126, 0, 39, 11, 19, 2, 49, 76, 71, 21, 66, 35, 23, 0, 73, 76, 89, 88, 77, 78, 72, 8, 47, 69,
+#> 71, 101, 90, 74, 67, 36, 49, 8, 0, 1, 51, 50, 67, 3, 75, 47, 97, 114, 92, 41, 11, 68, 15, 25, 44, 45, 7, 28, 0, 19, 32, 23, 47, 38, 37, 9, 3, 0, 42, 97, 95, 57, 69, 91, 50, 51, 79, 116, 53, 23, 37, 1, 0, 2, 3, 2, 5, 6, 10, 7, 3, 1, 4, 2, 1, 6, 0, 1, 1, 92, 32, 4, 128, 98, 97, 49, 90, 115, 88, 13, 5, 4, 41, 39, 20, 38, 25, 10, 30, 28, 26, 10, 21, 9, 7, 0, 70, 71, 86, 92, 92, 76, 90, 79, 73, 82, 80, 61, 22, 10, 1, 0, 6, 13, 11, 10, 9, 4, 3, 4, 8, 1, 0, 0, 58, 76, 87, 79, 81, 96, 132, 97, 94, 94, 108,
+#> 98, 99, 85, 33, 21, 81, 117, 110, 85, 75, 127, 126, 131, 113, 81, 0, 5, 100, 101, 78, 93, 86, 53, 83, 69, 47, 84, 33, 3, 41, 70, 59, 116, 92, 97, 80, 88, 84, 93, 74, 60, 64, 46, 62, 25, 20, 1, 0, 6, 2, 1, 1, 7, 6, 8, 5, 8, 6, 3, 3, 39, 109, 64, 57, 106, 77, 92, 109, 138, 90, 20, 24, 53, 36, 24, 16, 6, 19, 7, 1, 5, 0, 0, 2, 5, 3, 3, 7, 10, 1, 0, 0, 0, 63, 118, 104, 116, 112, 124, 90, 73, 27, 88, 56, 0, 1, 3, 8, 3, 5, 3, 6, 0, 0, 3, 2, 1, 0, 1, 3, 6, 10, 11, 7, 8, 10, 6, 4, 7, 8, 3, 10, 11, 10, 13,
+#> 3, 7, 2, 0, 1, 41, 63, 102, 72, 81, 38, 65, 5, 52, 51, 7, 6, 125, 108, 122, 99, 106, 104, 109, 62, 51, 61, 70, 81, 81, 83, 63, 82, 73, 30, 9, 23, 7, 15, 16, 37, 46, 28, 24, 20, 22, 1, 54, 42, 33, 8, 4, 0, 0, 9, 11, 20, 17, 21, 11, 14, 12, 11, 11, 8, 2, 1, 1, 5, 10, 7, 6, 5, 4, 4, 3, 0, 0, 14, 11, 17, 14, 27, 33, 55, 52, 54, 43, 13, 16, 38, 24, 9, 1, 1, 3, 3, 3, 4, 3, 1, 0, 0, 0, 1, 0, 0, 6, 5, 1, 0, 0, 85, 74, 79, 114, 92, 126, 98, 77, 19, 54, 80, 54, 7, 60, 16, 29, 3, 5, 5, 1, 3, 2, 1, 0, 0, 4,
+#> 47, 37, 31, 47, 73, 21, 48, 59, 22, 21, 10, 53, 35, 1, 6, 9, 7, 12, 4, 7, 1, 1, 4, 60, 49, 96, 99, 86, 46, 22, 61, 5, 33, 30, 65, 84, 5, 38, 45, 33, 0, 7, 0, 3, 0, 9, 48, 94, 98, 118, 87, 101, 106, 75, 86, 94, 68, 57, 22, 25, 15, 2, 4, 4, 50, 64, 57, 100, 87, 78, 96, 69, 67, 38, 19, 2, 32, 65, 70, 90, 73, 103, 43, 81, 39, 31, 8, 8, 11, 6, 18, 13, 8, 9, 2, 10, 0, 1, 84, 46, 10, 3, 37, 75, 74, 92, 99, 85, 55, 87, 76, 61, 46, 7, 5, 3, 1, 4, 8, 11, 5, 1, 0, 3, 0, 1, 0, 0, 0, 65, 79, 53, 78, 65, 110,
+#> 125, 87, 89, 54, 47, 19, 6, 54, 69, 48, 6, 1, 39, 12, 15, 23, 3, 101, 37, 13, 56, 61, 27, 55, 42, 24, 3, 18, 17, 4, 16, 1, 0, 0, 2, 2, 8, 5, 2, 3, 4, 6, 5, 0, 0, 0, 2, 0, 1, 0, 0, 0, 1, 3, 0, 0, 0, 0, 0, 29, 61, 55, 95, 99, 93, 52, 82, 56, 83, 66, 61, 54, 8, 1, 6, 22, 100, 109, 96, 80, 132, 120, 126, 112, 91, 45, 59, 38, 35, 28, 44, 16, 6, 4, 2, 6, 5, 7, 5, 1, 1, 6, 3, 0, 1, 42, 83, 78, 61, 74, 90, 83, 57, 42, 59, 18, 4, 10, 0, 100, 101, 79, 0, 3, 83, 106, 110, 84, 104, 92, 94, 91, 89, 57, 41, 1,
+#> 5, 72, 65, 82, 66, 79, 79, 87, 69, 44, 54, 59, 17, 119, 123, 101, 112, 121, 125, 107, 129, 130, 115, 121, 118, 99, 83, 84, 64, 94, 82, 27, 8, 24, 0, 3, 9, 5, 6, 3, 0, 1, 1, 0, 0, 0, 1, 0, 0, 4, 3, 2, 1, 4, 5, 8, 3, 2, 4, 1, 2, 4, 11, 13, 6, 2, 5, 2, 6, 1, 4, 1, 3, 0, 0, 0, 0, 0, 0, 4, 4, 18, 78, 59, 22, 85, 77, 89, 61, 98, 29, 11, 46, 27, 1, 0, 4, 9, 1, 0, 2, 0, 0, 1, 1, 0, 0, 3, 0, 0, 61, 94, 105, 129, 121, 132, 121, 127, 104, 119, 132, 96, 40, 92, 44, 40, 63, 57, 1, 2, 1, 8, 3, 14, 11, 12, 8, 5,
+#> 12, 6, 6, 1, 3, 7, 3, 1, 1, 1, 1, 6, 96, 65, 63, 26, 0, 10, 10, 32, 72, 8, 76, 33, 12, 56, 37, 34, 44, 1, 1, 0, 3, 100, 82, 101, 115, 76, 61, 64, 2, 94, 81, 101, 96, 74, 73, 99, 65, 60, 73, 61, 42, 11, 4, 0, 15, 125, 107, 110, 102, 89, 81, 91, 96, 74, 83, 77, 44, 54, 30, 89, 94, 91, 64, 102, 81, 88, 91, 107, 98, 68, 39, 22, 56, 35, 47, 0, 21, 9, 21, 0, 4, 0, 0, 0, 3, 5, 8, 3, 3, 4, 2, 0, 1, 1, 0, 0, 34, 18, 31, 22, 20, 20, 1, 3, 2, 2, 1, 2, 0, 2, 0, 0, 0, 0, 106, 86, 86, 86, 36, 93, 74, 79, 36, 41,
+#> 8, 6, 1, 49, 63, 76, 74, 62, 97, 104, 116, 91, 12, 29, 11, 11, 20, 32, 3, 39, 76, 102, 85, 112, 83, 74, 60, 54, 1, 7, 29, 0, 0, 1, 7, 6, 8, 7, 8, 9, 4, 2, 4, 0, 1, 1, 0, NA, 0, 0, 0, 0, 0, 5, 7, 9, 6, 5, 4, 3, 3, 6, 6, 0, 1, 5, 0, 1, 0, 5, 11, 1, 1, 1, 2, 0, 0, 58, 67, 10, 59, 75, 67, 60, 81, 82, 58, 59, 58, 1, 2, 0, 42, 45, 93, 76, 92, 111, 100, 109, 110, 82, 84, 85, 67, 79, 54, 45, 3, 80, 110, 96, 108, 103, 109, 97, 118, 108, 103, 106, 82, 83, 77, 72, 14, 39, 4, 9, 42, 121, 96, 83, 84, 86, 77,
+#> 116, 78, 89, 77, 72, 85, 94, 49, 74, 64, 69, 46, 40, 71, 2, 10, 7, 9, 9, 4, 10, 6, 4, 11, 5, 5, 5, 4, 0, 0, 3, 70, 98, 82, 113, 119, 97, 94, 75, 87, 41, 67, 79, 52, 68, 71, 60, 25, 4, 11, 6, 4, 10, 6, 9, 8, 3, 2, 2, 3, 1, 0, 0, 0, 0, 0, 69, 82, 76, 98, 86, 90, 72, 73, 93, 67, 97, 55, 55, 77, 86, 56, 47, 56, 122, 97, 90, 106, 86, 117, 134, 79, 103, 109, 122, 83, 69, 111, 88, 82, 41, 85, 75, 6, 19, 5, 78, 91, 79, 101, 86, 95, 109, 92, 86, 100, 71, 62, 17, 17, 0, 20, 0, 58, 105, 106, 118, 109, 116,
+#> 102, 115, 127, 121, 103, 109, 117, 113, 84, 100, 103, 95, 75, 84, 47, 45, 22, 0, 5, 7, 10, 10, 11, 4, 4, 5, 6, 7, 10, 3, 4, 3, 3, 2, 0, 0, 0, 1, 4, 3, 10, 9, 11, 11, 14, 11, 10, 6, 2, 0, 6, 0, 0, 3, 0, 0, 2, 15, 82, 76, 90, 60, 74, 74, 66, 62, 40, 6, 7, 4, 0, 28, 55, 44, 35, 46, 31, 67, 55, 33, 53, 63, 43, 38, 17, 4, 2, 109, 3, 96, 104, 119, 79, 106, 96, 94, 92, 89, 91, 14, 38, 4, 0, 0, 21, 60, 51, 86, 50, 51, 50, 48, 38, 42, 42, 66, 35, 1, 30, 44, 24, 56, 66, 67, 77, 84, 28, 72, 46, 26, 0, 3, 3,
+#> 6, 8, 13, 5, 9, 3, 0, 0, 1, 0, 0, 0, 4, 10, 7, 7, 2, 6, 9, 4, 4, 6, 10, 8, 0, 0, 3, 1, 1, 33, 35, 33, 45, 59, 29, 64, 63, 75, 63, 38, 38, 9, 13, 22, 0, 2, 8, 7, 5, 4, 8, 3, 4, 1, 0, 0, 2, 36, 91, 77, 48, 63, 35, 102, 69, 64, 80, 65, 17, 6, 1, 11, 46, 53, 72, 91, 56, 64, 86, 45, 73, 35, 55, 16, 4, 28, 76, 77, 68, 91, 103, 55, 42, 70, 81, 38, 4, 13, 9, 28, 10, 14, 0, 27, 79, 52, 69, 68, 114, 80, 92, 44, 29, 2, 6, 0, 30, 59, 69, 50, 58, 71, 55, 43, 66, 52, 56, 62, 36, 13, 29, 17, 3, 21, 21, 55, 60,
+#> 61, 37, 45, 50, 65, 81, 3, 35, 18, 12, 11, 10, 3, 21, 16, 10, 6, 1, 6, 11, 3, 7, 2, 9, 0, 0, 0, 13, 30, 3, 80, 87, 92, 95, 80, 82, 83, 101, 64, 63, 22, 9, 17, 92, 115, 92, 34, 41, 0, 88, 92, 81, 105, 105, 100, 75, 1, 5, 65, 91, 71, 74, 87, 31, 6, 0, 51, 3, 21, 1, 68, 81, 72, 69, 72, 89, 41, 54, 7, 58, 69, 34, 19, 20, 7, 3, 7, 0, 1, 2, 4, 6, 3, 7, 5, 3, 4, 5, 6, 3, 2, 2, 2, 0, 1, 0, 3, 1, 2, 0, 1, 0, 0, 0, 0, 0, 0, 0, 1, 4, 6, 4, 4, 6, 9, 3, 12, 8, 5, 11, 10, 8, 5, 4, 7, 11, 8, 4, 5, 1, 22, 62, 87,
+#> 103, 60, 40, 59, 2, 26, 45, 9, 7, 63, 73, 93, 76, 49, 66, 35, 16, 7, 1, 1, 83, 79, 83, 102, 99, 90, 71, 34, 73, 63, 18, 15, 32, 37, 59, 41, 103, 55, 93, 85, 73, 81, 101, 98, 45, 30, 52, 53, 43, 0, 20, 54, 32, 34, 8, 0, 0, 2, 3, 2, 2, 3, 3, 0, 1, 0, 0, 0, 5, 10, 8, 3, 3, 11, 6, 10, 0, 6, 2, 9, 9, 11, 3, 0, 5, 13, 31, 29, 74, 89, 77, 67, 82, 81, 91, 88, 65, 73, 84, 67, 48, 53, 46, 50, 16, 3, 1, 1, 12, 24, 9, 49, 70, 58, 64, 33, 36, 30, 6, 38, 72, 78, 89, 87, 82, 56, 30, 46, 23, 1, 4, 19, 61, 26, 61,
+#> 69, 98, 132, 92, 53, 86, 22, 37, 64, 25, 63, 5, 77, 81, 89, 93, 106, 92, 82, 85, 29, 34, 7, 38, 45, 40, 58, 67, 74, 85, 71, 76, 85, 70, 55, 58, 3, 4, 1, 0, 72, 51, 12, 55, 85, 61, 3, 35, 7, 28, 15, 13, 6, 2, 3, 2, 54, 36, 80, 58, 60, 53, 52, 71, 79, 111, 90, 60, 1, 28, 26, 37, 46, 78, 54, 61, 39, 63, 76, 63, 19, 19, 28, 63, 27, 8, 0, 3, 7, 3, 5, 6, 2, 1, 0, 2, 1, 2, 2, 6, 2, 0, 1, 3, 2, 0, 2, 2, 1, 0, 1, 0, 1, 7, 0, 2, 0, 1, 1, 1, 0, 0, 1, 0, 1, 0, 1, 2, 0, 1, 0, NA, 0, 2, 4, 3, 0, 0, 0, 0, 2, 1,
+#> 36, 18, 53, 45, 80, 99, 72, 90, 76, 71, 0, 4, 14, 4, 6, 7, 11, 13, 3, 2, 0, 0, 1, 0, 3, 6, 52, 39, 22, 59, 45, 50, 42, 42, 47, 37, 31, 33, 7, 48, 66, 42, 69, 60, 89, 100, 95, 77, 95, 91, 105, 103, 74, 87, 65, 82, 68, 20, 131, 107, 101, 107, 96, 99, 97, 70, 90, 60, 58, 74, 60, 56, 56, 46, 38, 27, 75, 105, 130, 83, 81, 92, 60, 92, 76, 57, 23, 77, 73, 16, 5, 5, 3, 1, 1, 0, 1, 0, 0, 4, 75, 94, 87, 100, 115, 100, 92, 91, 103, 137, 86, 95, 72, 55, 68, 36, 2, 16, 64, 119, 94, 67, 63, 79, 98, 64, 50, 81,
+#> 58, 72, 51, 51, 17, 3, 55, 66, 80, 90, 67, 129, 90, 91, 89, 92, 68, 20, 10, 8, 13, 4, 21, 49, 31, 41, 67, 4, 28, 29, 28, 41, 33, 37, 38, 20, 1, 9, 2, 0, 2, 0, 0, 0, 0, 0, 0, 2, 3, 7, 0, 0, 3, 0, 2, 2, 0, 1, 0, 0, 2, 0, 0, 0, 4, 1, 7, 0, 2, 4, 1, 1, 2, 2, 1, 0, 1, 2, 0, 0, 31, 20, 12, 74, 96, 73, 94, 91, 70, 56, 14, 5, 0, 0, 1, 0, 3, 0, 0, 1, 3, 6, 2, 2, 2, 2, 0, 0, 4, 7, 9, 9, 3, 9, 9, 5, 10, 18, 6, 2, 4, 1, 0, 0, 10, 9, 2, 11, 6, 12, 7, 7, 8, 17, 6, 3, NA, 1, 0, NA, 4, 4, 4, NA, 0, NA, 4, 2, 0,
+#> 0, 4, 90, 54, 70, 65, 43, 64, 83, 40, 24, 29, 42, 42, 27, 20, 3, 1, 94, 91, 75, 94, 76, 45, 60, 46, 13, 1, 1, 0, 0, 10, 10, 8, 5, 4, 3, 6, 8, 4, 7, 0, 0, 43, 60, 120, 69, 70, 3, 27, 72, 30, 2, 52, 4, 24, 17, 26, 9, 3, 53, 67, 43, 16, 1, 2, 1, 0, 3, 9, 8, 6, 6, 9, 3, 3, 3, 0, 0, 0, 2, 4, 0, 0, 0, 0, 0, 0, 1, 1, 2, 1, 0, 0, 3, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 2, 3, 1, 3, 1, 3, 3, 4, 5, 71, 99, 91, 77, 78, 81, 112, 90, 96, 125, 75, 70, 82, 93, 91, 71, 99, 70, 69, 49, 36, 53, 38, 4, 2, 65, 69,
+#> 74, 94, 126, 73, 63, 29, 21, 9, 21, 14, 47, 46, 47, 47, 24, 10, 14, 52, 46, 18, 33, 24, 8, 0, 2, 50, 24, 37, 53, 99, 112, 97, 90, 64, 68, 71, 80, 4, 1, 30, 29, 28, 31, 8, 27, 5, 23, 40, 25, 2, 0, 0, 1, 0, 12, 9, 2, 12, 10, 10, 9, 12, 7, 2, 101, 64, 117, 97, 86, 94, 120, 120, 86, 107, 115, 110, 112, 130, 95, 103, 90, 95, 73, 80, 52, 9, 34, 60, 15, 14, 79, 71, 51, 85, 45, 41, 49, 38, 44, 50, 23, 0, 16, 3, 3, 13, 6, 4, 2, 10, 5, 8, 3, 5, 4, 3, 4, NA, 0, 10, 12, 36, 74, 107, 96, 101, 93, 93, 62, 46,
+#> 66, 65, 27, 28, 10, 1, 4, 4, 11, 12, 8, 14, 11, 7, 3, 11, 14, 5, 12, 8, 6, 1, 0, 1, 5, 3, 3, 1, 2, 0, 1, 1, 0, 0, 44, 64, 67, 42, 47, 34, 15, 10, 15, 29, 48, 59, 5, 9, 0, 3, 15, 2, 1, 44, 84, 44, 79, 94, 88, 93, 107, 86, 97, 83, 77, 68, 65, 29, 8, 25, 34, 24, 25, 31, 26, 0, 31, 3, 4, 3, 0, 109, 107, 99, 76, 54, 97, 96, 73, 1, 63, 43, 46, 3, 6, 125, 93, 112, 89, 87, 79, 88, 82, 90, 39, 84, 54, 52, 19, 38, 64, 48, 83, 52, 81, 73, 53, 4, 7, 3, 1, 12, 10, 4, 2, 98, 84, 94, 85, 88, 95, 78, 89, 105, 40,
+#> 106, 96, 61, 53, 29, 28, 25, 7, 15, 83, 86, 66, 78, 75, 77, 78, 95, 31, 31, 7, 25, 31, 25, 17, 10, 4, 3, 64, 59, 21, 63, 44, 79, 72, 70, 89, 56, 61, 66, 1, 0, 40, 23, 57, 87, 68, 83, 67, 45, 72, 89, 97, 71, 67, 59, 33, 36, 2, 2, 4, 4, 1, 2, 3, 0, 5, 0, 0, 0, 0, 1, 37, 69, 45, 47, 66, 73, 61, 44, 57, 51, 33, 58, 42, 22, 13, 23, 77, 42, 61, 65, 59, 30, 45, 67, 67, 59, 25, 9, 5, 15, 72, 73, 69, 50, 66, 34, 4, 15, 1, 10, 57, 69, 51, 23, 29, 33, 40, 11, 20, 44, 29, 49, 59, 24, 15, 2, 0, 88, 61, 81, 52,
+#> 54, 15, 4, 1, 1, 21, 7, 2, 4, 5, 8, 8, 4, 11, 3, 8, 13, 5, 6, 1, 1, 1, 0, 0, 1, 1, 2, 8, 8, 5, 4, 9, 8, 6, 3, NA, 1, 0, 31, 1, 1, 63, 92, 75, 39, 29, 51, 66, 74, 19, 61, 3, 0, 14, 16, 2, 66, 3, 1, 34, 53, 68, 84, 54, 57, 89, 70, 104, 75, 106, 90, 71, 54, 29, 60, 60, 28, 2, 6, 0, 1, 0, 2, 2, 0, 3, 0, 0, 1, 0, 0, 1, 0, 1, 0, NA, 0, 1, 1, 3, 1, 1, 0, 1, 0, 0, 0, 2, 1, 0, 1, 0, 0, 0, 42, 47, 54, 51, 48, 5, 34, 34, 14, 8, 0, 3, 0, 2, 98, 73, 30, 97, 107, 58, 52, 30, 8, 3, 30, 47, 88, 59, 48, 28, 46, 38,
+#> 30, 25, 0, 4, 72, 40, 35, 38, 42, 40, 45, 44, 32, 7, 10, 5, 0, 0, 44, 67, 74, 54, 78, 53, 60, 83, 82, 59, 53, 52, 37, 64, 29, 0, 2, 45, 47, 19, 26, 25, 19, 8, 18, 5, 0, 3, 8, 5, 19, 13, 7, 13, 8, 9, 6, 2, 2, 21, 38, 48, 59, 96, 75, 60, 80, 122, 76, 72, 54, 70, 52, 0, 33, 4, 25, 0, 0, 0, 1, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 4, 4, 5, 3, 1, 2, 0, 3, 0, 0, 1, 0, 0, 0, 1, 40, 25, 78, 93, 103, 107, 72, 64, 73, 81, 74, 77, 71, 63, 58, 73, 35, 18, 18, 9, 25, 14, 1, 73, 79, 30, 81, 107, 94, 113, 92, 97,
+#> 114, 126, 81, 110, 105, 78, 73, 69, 31, 56, 4, 5, 7, 4, 1, 2, 2, 1, 2, 3, 2, 5, 1, 2, 0, 0, 1, 4, 3, 4, 3, 3, 5, 0, 2, 5, 8, 4, 6, 1, 5, 0, 73, 74, 23, 63, 50, 72, 71, 98, 74, 86, 73, 103, 51, 18, 19, 9, 0, 49, 35, 72, 48, 102, 79, 75, 47, 73, 77, 51, 29, 20, 10, 7, 0, 2, 29, 80, 67, 56, 42, 76, 84, 69, 45, 1, 0, 50, 68, 41, 67, 13, 1, 23, 35, 2, 7, 3, 0, 66, 46, 79, 27, 88, 61, 98, 86, 89, 97, 128, 85, 78, 74, 57, 88, 66, 42, 69, 5, 5, 7, 9, 8, 5, 9, 3, 7, 5, 10, 1, 5, 3, 5, 3, 3, 6, 0, 0, NA, NA,
+#> 3, 3, 5, 39, 53, 48, 50, 68, 35, 46, 16, 51, 19, 14, 30, 3, 13, 1, 6, 26, 28, 18, 13, 2, 31, 19, 90, 62, 102, 85, 113, 82, 38, 117, 90, 104, 80, 75, 10, 7, 0, 6, 0, 5, 4, 6, 4, 13, 8, 2, 1, NA, NA, NA, 0, 0, NA, NA, 2, 3, 0, 0, 0, 3, 9, 3, 12, 4, 5, 6, 4, 9, 3, NA, NA, NA, 5, 0, 0, 1, 2, 2, 10, 3, 7, 5, 2, 0, 0, 0, 1, 78, 78, 87, 109, 85, 75, 79, 79, 67, 35, 20, 104, 82, 41, 47, 5, 51, 3, 14, 28, 38, 88, 73, 83, 43, 45, 81, 40, 26, 34, 30, 15, 73, 73, 91, 98, 69, 99, 80, 51, 38, 11, 2, 7, 67, 83,
+#> 97, 80, 87, 83, 108, 83, 62, 67, 52, 73, 52, 14, 44, 32, 20, 12, 4, 10, 25, 37, 51, 27, 35, 31, 2, 22, 0, 19, 3, 3, 1, 0, 4, 1, 3, 6, 5, 0, NA, 0, 0, 0, 0, NA, 0, 2, 1, 0, NA, 0, 16, 15, 61, 24, 25, 9, 23, 10, 79, 6, 83, 3, 20, 6, 6, 69, 72, 47, 68, 66, 53, 64, 44, 42, 32, 62, 40, 0, 55, 15, 11, 12, 77, 32, 0, 1, 4, 1, 6, 1, 10, 4, 14, 3, 4, NA, NA, 1, 1, 19, 50, 61, 63, 109, 100, 77, 77, 52, 83, 77, 55, 12, 14, 35, 14, 0, 0, 0, 0, 0, 0, 0, 0, 0, 2, 1, 8, NA, 0, 0, NA, NA, NA, 2, 41, 36, 29, 20,
+#> 9, 15, 20, 20, 3, 0, 0, 0, 4, 6, 3, 6, 6, 7, 5, NA, NA, NA, NA, NA, 5, 47, 62, 50, 52, 68, 67, 31, 84, 56, 0, 23, 5, 14, 1, 2, 19, 40, 76, 53, 67, 36, 60, 54, 44, 66, 39, 39, 28, 37, 9, 6, 20, 13, 49, 98, 100, 65, 46, 82, 50, 81, 55, 40, 3, 15, 0, 4, 54, 61, 85, 59, 43, 69, 59, 63, 19, 57, 44, 10, 0, 1, 43, 54, 43, 65, 53, 71, 7, 36, 47, 67, 49, 39, 16, 33, 19, 8, 69, 40, 53, 53, 69, 68, 56, 18, 64, 38, 12, 36, 1, 13, 82, 123, 57, 87, 72, 99, 90, 91, 84, 93, 82, 78, 94, 33, 92, 43, 67, 64, 65, 42,
+#> 0, 38, 58, 53, 41, 92, 82, 82, 62, 44, 53, 31, 17, 0, 0, 5, 6, 5, 4, 5, 6, 6, 7, 8, 5, 7, 7, 9, 7, 5, 8, 9, 8, 2, NA, 3, 1, NA, NA, NA, 1, 38, 28, 4, 28, 37, 86, 87, 59, 105, 97, 85, 11, 46, 59, 1, 8, 1, 2, 74, 46, 63, 92, 71, 63, 39, 48, 62, 2, 2, 2, 0, 1, 1, 0, 1, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, NA, 0, NA, 0, 0, 7, 39, 65, 53, 89, 80, 46, 63, 14, 31, 65, 29, 13, 5, 7, 4, 8, 0, 5, 0, 3, 5, 2, 4, 8, 9, 10, 3, NA, NA, NA, 0, 2, 39, 61, 50, 13, 10, 35, 36, 50, 53, 56, 12, 60, 38, 6, 14, 6,
+#> 0, 0, 11, 62, 53, 42, 37, 20, 14, 26, 25, 3, 6, 2, 2, 4, 51, 50, 49, 49, 25, 45, 29, 41, 48, 21, 6, 24, 42, 62, 90, 51, 70, 79, 61, 41, 45, 19, 47, 69, 82, 77, 59, 57, 89, 23, 8, 6, 59, 71, 54, 80, 64, 83, 79, 85, 73, 42, 0, 6, 7, 5, 7, 8, 9, 2, 0, 1, 1, 2, 5, 2, 5, 5, 3, 5, 1, 3, NA, 1, NA, 0, 1, 2, 4, 1, 6, 7, 0, 0, NA, NA, NA, 8, 10, 35, 28, 104, 112, 88, 42, 45, 58, 32, 1, 7, 2, 1, 1, 6, 4, 0, 0, NA, NA, 0, 8, 7, 3, 4, NA, NA, 0, 3, 6, 6, 91, 80, 75, 89, 87, 87, 93, 85, 74, 100, 56, 49, 73, 35,
+#> 6, 55, 120, 134, 110, 118, 131, 97, 93, 48, 103, 8, 85, 93, 37, 26, 12, 56, 103, 60, 91, 52, 74, 65, 86, 66, 92, 84, 81, 82, 86, 41, 16, 61, 9, 3, 20, 59, 38, 42, 72, 55, 54, 35, 48, 5, 34, 25, 16, 7, 26, 49, 51, 70, 8, 38, 66, 79, 90, 81, 61, 83, 44, 57, 59, 47, 16, 13, 0, 4, 64, 72, 58, 47, 42, 18, 17, 39, 9, 18, 58, 78, 77, 60, 53, 35, 36, 2, 56, 49, 78, 52, 34, 11, 8, 2, 3, 82, 95, 94, 102, 83, 69, 80, 73, 90, 66, 22, 42, 41, 14, 12, 2, 10, 27, 60, 81, 40, 59, 30, 24, 16, 23, 16, 7, 0, 2, 11,
+#> 2, 5, 13, 7, 12, NA, NA, NA, NA, NA, NA, NA, 0, NA, NA, NA, NA, 1, 14, 54, 78, 85, 78, 85, 87, 65, 59, 67, 61, 75, 56, 59, 20, 3, 12, 6, 62, 63, 60, 55, 64, 77, 60, 52, 42, 15, 8, 2, 0, 2, 0, 0, 3, 1, 0, NA, NA, NA, NA, 0, NA, 0, 3, 1, 2, 5, 8, 4, 1, 1, 1, 0, 1, 0, 2, 0, 0, 0, 5, 4, 100, 60, 73, 6, 94, 102, 87, 122, 116, 107, 107, 113, 113, 68, 70, 66, 47, 68, 72, 50, 1, 19, 26, 22, 83, 71, 83, 64, 66, 60, 61, 46, 26, 18, 7, 0, 1, 0, 4, 4, 2, 3, 5, 7, 5, 5, NA, NA, 0, NA, NA, NA, 5, 2, NA, NA, 5,
+#> NA, NA, 0, 2, 51, 43, 43, 35, 21, 14, 0, 0, 7, 74, 65, 36, 47, 76, 106, 94, 49, 73, 44, 66, 85, 54, 85, 42, 68, 37, 47, 65, 42, 12, 2, 0, 8, 44, 54, 35, 42, 21, 12, 71, 63, 40, 42, 55, 55, 2, 6, 0, 46, 85, 103, 86, 95, 93, 89, 92, 31, 57, 71, 42, 52, 40, 59, 24, 14, 5, 50, 74, 67, 42, 97, 79, 71, 93, 78, 74, 57, 34, 50, 73, 33, 13, 2, 1, 6, 5, 3, 6, 10, 1, NA, NA, NA, NA, NA, NA, 4, 10, 10, 40, 62, 94, 53, 73, 66, 54, 48, 58, 35, 42, 14, 21, 1, 8, 3, 13, 5, 60, 28, 5, 1, 7, 0, 74, 74, 58, 55, 60,
+#> 51, 58, 1, 47, 31, 35, 33, 41, 31, 2, 1, 9, 16, 21, 39, 26, 7, 1, 0, 0, 2, 1, 2, NA, 0, NA, 0, 0, NA, 0, 0, NA, 2, NA, 0, 0, 0, 2, 0, 0, 2, 6, 1, 0, 2, 2, 1, 1, NA, NA, 0, 0, 27, 67, 82, 85, 87, 71, 97, 80, 85, 89, 77, 69, 67, 77, 30, 27, 2, 32, 11, 19, 11, 7, 66, 82, 92, 81, 93, 24, 68, 78, 60, 56, 74, 65, 60, 74, 42, 0, 15, 16, 48, 49, 45, 58, 36, 3, 18, 20, 21, 43, 8, 16, 5, 5, 4, 5, 14, 0, 64, 84, 67, 66, 54, 37, 24, 11, 17, 24, 5, 0, 0, 0, 1, 1, 0, 0, NA, NA, NA, 0, NA, NA, NA, NA, 5, 73, 35,
+#> 47, 71, 74, 21, 80, 118, 61, 77, 63, 47, 6, 11, 74, 87, 67, 79, 89, 75, 97, 79, 62, 89, 66, 101, 45, 49, 3, 10, 0, 0, 23, 16, 65, 87, 63, 95, 76, 73, 51, 61, 62, 34, 20, 7, 1, 11, 67, 106, 93, 75, 64, 97, 84, 64, 75, 65, 85, 57, 28, 10, 0, 2, 4, 4, 5, 6, 4, 6, 0, 0, 0, NA, NA, NA, 2, NA, 2, 3, 4, 42, 67, 114, 99, 82, 11, 42, 64, 82, 68, 69, 51, 64, 94, 60, 81, 78, 90, 48, 31, 0, 3, 0, 7, 5, 11, 1, 0, 35, 30, 29, 47, 55, 61, 24, 53, 84, 72, 72, 38, 20, 64, 47, 25, 19, 21, 2, 2, 0, 0, 3, 0, 1, 2, 0,
+#> 0, 1, 0, NA, 0, 0, 0, 0, 0, 8, 27, 36, 37, 95, 85, 85, 91, 89, 92, 78, 63, 66, 76, 72, 80, 58, 5, 5, 48, 64, 58, 26, 19, 61, 34, 58, 1, 33, 20, 3, 5, 9, 9, 5, 10, 14, 5, 0, 0, NA, 0, NA, NA, NA, 8, 5, 13, 32, 35, 73, 69, 59, 54, 28, 38, 16, 14, 14, 2, 1, 5, 4, 8, 2, 3, 12, 8, 3, 2, NA, 1, 38, 24, 40, 39, 70, 62, 74, 59, 75, 91, 72, 57, 48, 54, 46, 59, 42, 32, 11, 25, 10, 54, 29, 25, 25, 9, 12, 1, 20, 4, 71, 84, 81, 71, 91, 72, 49, 35, 32, 42, 43, 5, 19, 57, 82, 80, 98, 63, 60, 15, 86, 43, 67, 57,
+#> 44, 31, 8, 81, 70, 40, 55, 21, 68, 82, 68, 26, 8, 21, 2, 43, 108, 93, 112, 114, 93, 109, 104, 78, 108, 104, 93, 89, 97, 88, 52, 19, 3, 3, 7, 6, 8, 5, 2, NA, NA, 2, 4, 44, 75, 69, 91, 78, 68, 69, 48, 42, 61, 30, 1, 1, 0, 0, NA, NA, 2, 1, 0, 0, 0, 0, 1, 1, 0, 0, 0, 2, 1, 4, 2, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, NA, NA, 16, 65, 77, 68, 70, 76, 48, 37, 62, 35, 92, 68, 38, 20, 49, 38, 56, 5, 3, 2, 0, 9, 4, 8, 7, 0, 3, NA, 0, 0, 0, NA, NA, NA, NA, 0, NA, 5, 103, 76, 81, 75, 116, 67, 28, 89, 56, 84, 59, 67,
+#> 49, 37, 9, 44, 18, 5, 40, 48, 43, 40, 58, 41, 42, 39, 10, 0, 62, 81, 74, 50, 4, 75, 85, 62, 70, 59, 37, 39, 27, 29, 22, 1, 1, 5, 5, 4, 3, 5, 0, 10, 1, 1, 1, 5, 4, 3, 1, 2, 3, 1, 1, 2, NA, 1, NA, NA, NA, 0, 13, 27, 81, 78, 65, 65, 74, 71, 88, 99, 81, 71, 52, 46, 47, 56, 56, 66, 36, 16, 5, 6, 92, 75, 104, 121, 117, 81, 51, 86, 90, 98, 85, 98, 66, 57, 22, 4, 45, 47, 64, 79, 81, 64, 90, 56, 99, 100, 64, 100, 81, 40, 65, 36, 2, 4, 7, 6, 2, 6, 8, 1, 0, 1, 0, 13, 66, 76, 29, 85, 74, 99, 85, 47, 44, 55,
+#> 87, 73, 47, 1, 55, 63, 69, 88, 90, 96, 90, 62, 75, 65, 69, 96, 53, 90, 70, 9, 27, 1, 20, 17, 27, 75, 82, 107, 102, 109, 71, 29, 41, 68, 73, 88, 89, 77, 43, 56, 71, 45, 2, 0, 0, NA, NA, NA, 0, NA, NA, 0, NA, NA, NA, 0, 1, 0, 0, 0, NA, 0, NA, NA, 0, 0, 0, 0, 0, 0, 2, 2, 0, 0, NA, NA, 0, 0, 0, 1, 2, 39, 11, 15, 6, 31, 71, 86, 124, 97, 68, 79, 64, 64, 74, 67, 57, 2, 28, 14, 14, 47, 6, 64, 68, 65, 46, 54, 47, 40, 30, 40, 27, 14, 7, 4, 24, 0, 1, 45, 45, 33, 61, 54, 50, 59, 42, 37, 30, 43, 38, 41, 9, 8,
+#> 13, 13, 2, 46, 60, 61, 61, 39, 75, 69, 72, 84, 122, 74, 121, 110, 86, 109, 96, 82, 66, 35, 69, 73, 33, 65, 67, 55, 47, 71, 20, 40, 53, 19, 31, 21, 0, 3, 4, 6, 0, 3, 6, 4, 3, 3, 3, 0, 3, 3, 2, 0, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 4, 4, 3, 6, 6, 4, 4, 6, 7, 4, 2, 3, 1, 2, 3, 1, 3, NA, NA, NA, NA, NA, NA, NA, 1, NA, NA, 0, 0, NA, NA, NA, NA, NA, 0, 0, 0, 2, 0, 0, 0, 0, 0, 0, 0, NA, 0, 0, NA, 0, NA, NA, NA, NA, 0, 0, 0, 1, 0, 0, 0, 1, 0, 0, 4, 0, 0, 1, 3, 0, 0, 0, 2, 49, 84, 94, 105, 79,
+#> 119, 87, 42, 101, 90, 42, 108, 70, 71, 90, 67, 82, 77, 55, 69, 1, 18, 39, 9, 36, 71, 58, 75, 104, 90, 55, 73, 38, 91, 84, 30, 41, 22, 5, NA, NA, 0, 0, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 0, 0, NA, 3, 6, 31, 18, 26, 69, 70, 95, 79, 78, 37, 35, 96, 62, 6, 37, 40, 2, 3, 78, 60, 69, 55, 9, 52, 52, 22, 70, 66, 36, 19, 1, 39, 6, 2, 0, 4, 4, 42, 41, 28, 40, 55, 48, 38, 34, 19, 42, 46, 33, 37, 48, 42, 38, 33, 11, 19, 24, 95, 111, 117, 90, 62, 89, 65, 70, 60, 44, 68, 36, 33, 65, 21,
+#> 5, 26, 6, 13, 10, 20, 19, 43, 39, 59, 66, 73, 70, 35, 71, 52, 58, 62, 76, 67, 48, 34, 20, 8, 10, 60, 43, 49, 56, 61, 19, 26, 18, 25, 44, 60, 54, 48, 14, 6, 9, 28, 44, 71, 98, 63, 69, 11, 58, 27, 72, 39, 60, 59, 5, 0, 0, 3, 2, 62, 101, 80, 63, 36, 86, 62, 86, 80, 48, 80, 71, 31, 48, 25, 81, 85, 90, 100, 57, 87, 115, 97, 111, 61, 89, 75, 66, 96, 69, 64, 77, 57, 68, 36, 33, 13, 0, 9, 64, 84, 90, 96, 71, 107, 104, 73, 65, 65, 90, 78, 62, 72, 69, 60, 44, 34, 30, 6, 9, 59, 91, 87, 98, 99, 59, 85, 73, 86,
+#> 75, 76, 96, 43, 62, 15, 37, 60, 29, 1, 75, 52, 7, 88, 68, 37, 81, 95, 96, 18, 16, 11, 7, 0, 2, 3, 2, 4, 4, 0, NA, NA, NA, NA, NA, NA, 5, 3, 5, 3, 3, 2, 1, 2, 1, NA, NA, NA, NA, NA, 36, 66, 75, 80, 75, 93, 89, 53, 4, 22, 2, 35, 26, 0, 0, 29, 64, 70, 62, 66, 80, 60, 82, 71, 68, 84, 45, 73, 76, 44, 60, 14, 20, 6, 3, 3, 4, 3, 9, 9, 5, 8, 4, 1, NA, 0, 2, 8, 7, 7, 1, 4, 2, 2, 0, 32, 94, 82, 105, 83, 47, 76, 39, 40, 63, 42, 42, 35, 43, 45, 20, 5, 17, 55, 52, 44, 54, 40, 47, 57, 20, 11, 16, 36, 2, 0, 0,
+#> 3, 1, 0, 0, NA, NA, 0, 0, NA, NA, NA, 0, 9, 13, 65, 41, 21, 40, 34, 66, 60, 52, 38, 50, 41, 17, 5, 3, 20, 54, 90, 90, 116, 111, 65, 79, 43, 34, 83, 87, 94, 87, 43, 18, 7, 6, 77, 95, 108, 72, 85, 93, 109, 79, 35, 58, 64, 5, 32, 52, 38, 11, 4, 2, 36, 63, 75, 73, 40, 8, 15, 33, 30, 5, 0, 0, 0, 4, 3, 11, 5, 3, 7, 3, 5, 5, 5, 2, 5, 10, 2, 1, 6, 3, NA, NA, NA, 0, NA, NA, 5, 71, 75, 68, 48, 76, 94, 90, 102, 95, 110, 54, 77, 75, 94, 77, 72, 67, 36, 50, 66, 81, 42, 85, 75, 15, 61, 70, 15, 43, 26, 43, 60,
+#> 71, 54, 89, 98, 94, 32, 77, 65, 93, 73, 84, 75, 32, 9, 42, 9, 11, 5, 2, 2, 48, 67, 59, 66, 66, 72, 121, 50, 129, 102, 105, 76, 82, 99, 92, 101, 98, 66, 71, 62, 3, 14, 64, 90, 84, 77, 60, 90, 82, 33, 71, 34, 93, 81, 76, 59, 75, 32, NA, NA, NA, NA, NA, 0, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 0, NA, 0, 4, 1, 0, 0, 0, 1, 0, 0, 0, 0, 0, 9, 0, 12, 55, 49, 66, 86, 60, 83, 96, 70, 104, 106, 63, 82, 46, 25, 49, 86, 51, 66, 75, 64, 71, 89, 76, 44, 62, 75, 88, 28, 33, 89, 74, 3, 24, 4, 5, 55, 53, 50,
+#> 62, 84, 51, 26, 73, 8, 41, 36, 16, 0, 3, 55, 42, 51, 53, 40, 68, 37, 52, 33, 16, 45, 36, 22, 27, 15, 3, 9, 57, 74, 81, 104, 88, 97, 89, 52, 84, 99, 106, 105, 90, 83, 96, 63, 7, 75, 92, 72, 35, 11, 4, 0, 33, 64, 66, 79, 85, 87, 103, 120, 39, 52, 80, 82, 84, 70, 93, 64, 3, 28, 3, 41, 70, 8, 20, 77, 97, 89, 22, 90, 78, 91, 49, 49, 8, NA, NA, NA, NA, 0, 0, NA, NA, NA, 0, NA, NA, 0, NA, NA, 49, 67, 41, 48, 83, 5, 0, 5, 1, 81, 63, 30, 57, 62, 53, 75, 74, 69, 39, 49, 38, 27, 21, 15, 0, 0, 6, 1, 2, NA, NA,
+#> 3, NA, 4, 3, 8, 8, 5, 0, 2, NA, NA, 0, 4, 2, 50, 59, 66, 43, 61, 77, 101, 51, 22, 46, 57, 56, 30, 21, 19, 22, 34, 77, 100, 68, 88, 62, 90, 67, 93, 85, 48, 71, 52, 28, 22, 46, 15, 93, 80, 94, 64, 24, 2, 55, 70, 15, 17, 57, 59, 32, 17, 65, 54, 41, 65, 70, 4, 5, 22, 16, 65, 97, 31, 40, 80, 25, 68, 66, 70, 1, 24, 69, 95, 110, 87, 62, 82, 48, 17, 37, 9, 12, 46, 5, 2, 0, 1, 8, 5, 2, 0, 0, 1, 1, 2, 6, 1, 7, 1, 2, 1, 4, 6, NA, NA, NA, NA, NA, 0, 3, 1, 1, 1, 3, 1, 0, 2, 0, 1, 1, 0, 0, 0, 0, 0, 0, 0, 1, 2,
+#> 0, 2, 3, 1, NA, NA, NA, 0, NA, 15, 57, 86, 58, 84, 55, 93, 77, 50, 39, 14, 20, 0, 10, 43, 113, 133, 54, 87, 90, 81, 87, 77, 97, 81, 58, 49, 38, 38, 29, 4, 0, NA, 0, 0, NA, NA, NA, 1, NA, 0, 6, 49, 68, 107, 52, 66, 83, 85, 79, 107, 109, 73, 54, 71, 57, 11, 72, 38, 28, 16, 17, 20, 0, 14, 37, 35, 46, 24, 13, 13, 44, 23, 2, 0, 5, 58, 31, 86, 76, 74, 76, 48, 91, 63, 75, 83, 81, 55, 39, 14, 24, 22, 24, 69, 77, 67, 53, 58, 69, 53, 70, 67, 104, 80, 82, 61, 96, 73, 75, 51, 16, 36, NA, NA, NA, NA, NA, NA,
+#> NA, NA, NA, NA, 0, 0, 0, 76, 14, 7, 1, 0, 0, 1, 0, NA, NA, NA, NA, 0, NA, NA, NA, 10, 37, 65, 79, 39, 75, 80, 75, 64, 53, 42, 44, 48, 54, 38, 7, 19, 2, 10, 15, 2, 27, 16, 28, 45, 36, 63, 71, 88, 94, 53, 92, 49, 49, 40, 31, 8, 10, 64, 65, 82, 72, 75, 9, 55, 67, 73, 67, 65, 73, 57, 5, 23, 45, 14, 12, 1, 9, 6, 6, 2, 7, 11, 0, 7, 4, 1, 3, 7, 9, 0, 3, 1, 1, 1, 7, 25, 47, 70, 23, 29, 18, 8, 15, 22, 28, 31, 28, 12, 18, 10, 0, 1, 0, NA, NA, NA, NA, NA, 1, 3, 6, 4, 0, NA, 1, 2, 1, 2, 0, 0, 0, 1, 0, 0, 0,
+#> 1, 0, 3, 60, 88, 72, 69, 77, 84, 77, 81, 42, 62, 73, 71, 64, 42, 12, 0, 3, 6, 5, 5, 7, 5, 4, 2, 3, 8, NA, NA, 0, 3, 4, 0, 1, 5, 0, 25, 44, 38, 35, 33, 21, 9, 1, 49, 111, 89, 119, 105, 113, 146, 130, 78, 118, 41, 72, 119, 105, 77, 77, 37, 66, 67, 110, 21, 63, 101, 89, 17, 58, 70, 40, 7, 0, 4, 4, 1, 0, 6, 2, 1, 4, 5, 4, 3, 3, 5, 0, NA, NA, NA, NA, NA, NA, NA, NA, 0, NA, 0, NA, 0, 0, 0, NA, NA, NA, 63, 114, 87, 61, 65, 43, 70, 51, 80, 89, 80, 81, 58, 0, 65, 0, 26, 17, 29, 87, 51, 58, 77, 107, 50, 40,
+#> 8, 42, 22, NA, NA, 1, 0, NA, NA, 3, NA, 0, NA, 0, 0, NA, NA, NA, NA, NA, NA, 3, 7, 27, 46, 87, 87, 85, 99, 7, 89, 24, 16, 60, 42, 41, 10, 18, 18, 41, 34, 42, 53, 19, 33, 20, 5, 13, 31, 16, 4, 10, NA, NA, NA, 4, 7, 4, NA, NA, NA, NA, NA, 3, 5, 66, 53, 98, 43, 113, 131, 94, 118, 89, 115, 77, 60, 38, 22, 66, 5, 1, 1, 90, 121, 103, 116, 98, 97, 87, 80, 78, 99, 73, 87, 71, 71, 94, 79, 65, 51, 43, 43, 15, 88, 94, 70, 62, 91, 84, 70, 88, 70, 85, 74, 20, 2, 5, 3, 50, 24, 89, 84, 79, 70, 57, 3, 26, 2, 0,
+#> 20, 36, 63, 72, 67, 64, 49, 94, 49, 77, 50, 69, 65, 1, 42, 42, 84, 58, 86, 58, 66, 70, 10, 4, 2, 2, 4, 4, 1, 10, 1, 6, 2, 1, 0, 2, 2, 7, 4, 1, NA, 0, 0, 2, 1, 0, 0, NA, NA, NA, NA, NA, NA, NA, NA, NA, 16, 10, 34, 27, 70, 97, 78, 54, 96, 51, 21, 6, 76, 21, 24, 0, 0, 1, 0, NA, NA, NA, 1, 0, 0, NA, NA, NA, NA, NA, 0, 6, 4, 69, 40, 120, 83, 77, 77, 15, 80, 26, 14, 89, 72, 58, 23, 8, 35, 13, 2, 5, 4, 2, 1, 2, 8, 7, 5, 3, 5, 2, 1, NA, NA, NA, 0, 1, 1, NA, 0, NA, NA, NA, NA, NA, NA, NA, 1, 1, 2, 0, 0, 12,
+#> 18, 11, 1, 27, 41, 48, 51, 24, 35, 33, 37, 54, 42, 16, 25, 16, 13, 15, 2, NA, 0, NA, NA, 0, 0, 4, 3, 0, 4, 3, 4, 10, 5, NA, NA, NA, 0, 7, 3, 2, 6, 2, 103, 94, 114, 113, 68, 81, 77, 104, 116, 104, 100, 67, 36, 85, 54, 1, 16, 53, 51, 77, 53, 56, 40, 55, 36, 62, 45, 39, 20, 18, 25, 14, 4, 2, 43, 75, 82, 114, 65, 76, 73, 23, 23, 76, 67, 56, 53, 19, 32, 52, 29, 27, 25, 1, 8, 7, 64, 71, 43, 72, 43, 15, 13, 22, 51, 46, 34, 0, 0, 2, 1, 0, 0, 0, NA, 0, 1, NA, NA, 3, 75, 67, 51, 34, 8, 21, 31, 26, 4, 29, 7,
+#> 63, 75, 78, 76, 108, 101, 69, 92, 86, 20, 12, 13, 15, 35, 1, 44, 10, 51, 100, 109, 107, 107, 108, 128, 113, 89, 93, 62, 83, 61, 76, 80, 55, 51, 40, 44, 36, 51, 104, 97, 92, 89, 106, 77, 72, 64, 37, 10, 79, 68, 75, 67, 67, 16, 48, 75, 52, 47, 0, 11, 28, 32, 75, 47, 54, 54, 46, 51, 20, 19, 25, 12, 2, 46, 33, 51, 24, 44, 49, 87, 79, 73, 79, 53, 62, 85, 96, 69, 48, 47, 9, 6, 32, 13, 73, 81, 3, 26, 24, 6, 36, 45, 54, 44, 30, 23, 15, 34, 55, 39, 75, 65, 53, 51, 42, 69, 35, 12, 1, 4, 3, 0, 0, 1, 5, 1, 2,
+#> 2, 0, 6, NA, 1, NA, 3, 5, 61, 90, 133, 106, 115, 91, 123, 66, 76, 65, 102, 102, 75, 80, 81, 45, 56, 53, 20, 1, 13, 9, 0, 0, 2, 0, 0, 0, 0, 0, NA, NA, NA, 0, 0, 0, NA, 0, NA, NA, NA, 0, 0, 3, 23, 41, 34, 60, 92, 96, 84, 95, 106, 35, 59, 81, 6, 62, 71, 37, 0, 1, 0, 0, 0, 1, 0, 2, 0, 0, 0, 0, NA, NA, 5, 0, 56, 41, 94, 63, 32, 38, 19, 26, 4, 6, 0, 3, 3, 0, 0, 3, 2, 8, 2, NA, NA, 0, 80, 78, 66, 86, 67, 84, 63, 39, 5, 5, 11, 5, 4, 8, 1, 4, 7, 8, 5, 1, NA, 0, 0, 1, 0, 0, 0, 33, 34, 88, 90, 107, 119, 64,
+#> 82, 79, 69, 77, 70, 79, 82, 67, 97, 65, 59, 17, 5, 0, 0, 6, 8, 5, 0, 3, 4, 10, 2, 9, 2, 9, NA, 0, 0, 0, 34, 91, 107, 117, 93, 94, 79, 40, 64, 89, 78, 62, 59, 1, 1, 2, NA, 0, 0, NA, NA, 0, 0, NA, NA, NA, NA, 1, NA, NA, 0, 2, 7, 1, 2, 0, 0, 0, 0, 5, 19, 63, 67, 93, 49, 65, 77, 66, 37, 27, 0, 1, 19, 89, 54, 55, 70, 50, 89, 52, 76, 69, 60, 53, 42, 68, 24, 23, 14, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, NA, 0, NA, 0, 0, NA, 0, NA, 71, 58, 64, 58, 63, 61, 52, 5, 44, 46, 50, 62, 59, 35, 2, 21, 22, 107, 94, 121, 77,
+#> 94, 73, 45, 37, 64, 61, 39, 27, 10, 0, 19, 5, 85, 87, 101, 111, 78, 88, 67, 63, 74, 36, 8, 34, 40, 53, 61, 67, 50, 57, 61, 56, 74, 48, 28, 14, 5, 55, 42, 89, 76, 72, 86, 72, 59, 55, 55, 18, 11, 41, 76, 58, 64, 44, 60, 80, 15, 40, 40, 57, 5, 24, 2, 3, 8, 49, 100, 88, 101, 77, 83, 39, 20, 4, 29, 50, 83, 43, 67, 97, 48, 73, 42, 4, 65, 9, 39, 17, 6, NA, NA, NA, NA, NA, 3, 9, 6, 1, 0, 0, 0, 3, 0, 7, 56, 59, 94, 72, 83, 31, 15, 1, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 0, 1, 0, 0, 0, 0, 1, 0,
+#> 1, 2, 0, 0, 1, 0, 4, 2, 2, 3, 7, 7, 4, 1, 2, 0, 0, 4, 59, 81, 55, 71, 91, 95, 66, 63, 61, 58, 41, 3, 37, 53, 76, 71, 63, 21, 39, 22, 0, 7, 54, 58, 51, 94, 107, 89, 62, 71, 8, 69, 37, 8, 63, 80, 119, 96, 109, 75, 82, 92, 104, 89, 79, 83, 5, 29, 71, 91, 90, 76, 64, 84, 81, 84, 20, 45, 50, 57, 55, 71, 73, 6, 5, 14, 41, 56, 55, 47, 61, 57, 2, 19, 12, 0, NA, NA, 0, 0, NA, NA, NA, NA, NA, NA, NA, NA, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 16, 85, 81, 120, 40, 83, 115, 66, 8, 30, 88, 64, 68, 56, 98, 75, 16, 31,
+#> 46, 6, 51, 91, 70, 78, 87, 44, 29, 46, 8, 11, 26, 53, 90, 30, 35, 44, 73, 88, 39, 34, 0, 2, 22, 30, 21, 54, 66, 49, 11, 33, 24, 3, 4, 7, 5, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 0, 0, 2, 4, 2, NA, NA, NA, 0, NA, 0, 0, 0, 0, 3, 0, 0, 0, 0, 0, 0, NA, 0, 0, 0, NA, NA, NA, NA, NA, 4, NA, NA, NA, 1, NA, NA, NA, NA, NA, 0, 0, 37, 56, 56, 82, 44, 83, 46, 94, 98, 81, 25, 70, 21, 30, 11, 17, 0, 2, 18, 33, 24, 15, 27, 25, 22, 6, 0, 6, 7, 33, 26, 97, 120, 81, 74, 84, 39, 21, 14, 57, 19,
+#> 81, 29, 81, 27, 38, 17, 73, 88, 81, 45, 136, 95, 3, 93, 62, 114, 115, 84, 64, 133, 89, 121, 86, 63, 99, 63, 75, 1, 2, 47, 29, 1, 20, 32, 74, 76, 49, 48, 70, 45, 12, 69, 39, 10, 97, 87, 74, 87, 62, 87, 16, 26, 75, 104, 48, 38, 130, 118, 60, 48, 10, 64, 49, 50, 42, 60, 37, 49, 35, 40, 71, 31, 3, 28, 22, 39, 56, 53, 15, 1, 3, 2, 69, 53, 15, 12, 21, 52, 42, 25, 11, 4, 1, 14, 105, 101, 90, 113, 68, 37, 32, 62, 74, 15, 7, 31, 32, 28, 3, 34, 13, 14, NA, 0, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 0,
+#> NA, 1, 1, 2, 6, 3, 3, 1, 1, 0, 3, 2, 0, 2, NA, 2, NA, NA, 0, NA, NA, NA, NA, NA, NA, NA, 1, 1, 7, 0, NA, 0, 0, 0, NA, 0, 0, 0, 0, 0, NA, 3, 66, 42, 37, 32, 50, 48, 47, 51, 43, 79, 60, 45, 35, 0, 4, 5, 4, 10, 1, 4, 0, 6, 6, 11, 4, NA, NA, 0, 7, 3, 0, 8, 3, 15, 46, 73, 61, 87, 100, 95, 55, 64, 33, 7, 8, 103, 76, 86, 57, 110, 98, 116, 67, 61, 77, 37, 84, 60, 26, 52, 51, 45, 61, 48, 93, 101, 64, 67, 87, 103, 42, 41, 6, 26, 1, 0, 40, 45, 63, 63, 54, 59, 52, 28, 20, 23, 10, 0, 1, 0, 0, 0, 1, 0, 0, 0, 0,
+#> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 3, 44, 30, 50, 15, 36, 50, 58, 65, 89, 52, 64, 38, 29, 74, 40, 95, 91, 42, 86, 41, 10, 0, 15, 3, 68, 82, 97, 80, 86, 88, 80, 96, 108, 19, 85, 72, 72, 46, 22, 0, 13, 51, 28, 37, 30, 14, 1, 7, 7, 4, 71, 86, 87, 71, 76, 16, 77, 60, 67, 35, 9, 39, 72, 99, 76, 65, 34, 38, 71, 77, 89, 119, 120, 103, 67, 17, 33, 30, 36, 1, 27, 28, 58, 87, 96, 112, 102, 62, 81, 60, 47, 49, 107, 77, 11, 28, 12, 23, 17, 0, 0, 2, NA, NA, 1, 4, 1, 1, 0, NA, NA, NA, 0, NA, 27, 64, 91, 47, 85,
+#> 88, 76, 57, 78, 98, 117, 34, 93, 108, 71, 29, 72, 39, 55, 4, 4, 0, 23, 16, 28, 53, 35, 55, 48, 57, 63, 42, 14, 5, 0, 2, 3, 0, NA, NA, 0, NA, NA, 0, NA, 0, NA, 0, NA, NA, NA, NA, NA, 66, 89, 102, 104, 91, 84, 69, 82, 73, 85, 69, 56, 98, 40, 49, 29, NA, NA, NA, NA, NA, 11, 4, 1, 1, 0, 2, 3, 3, 1, 1, 0, 1, 15, 68, 61, 89, 86, 82, 74, 75, 65, 45, 44, 23, 9, 46, 63, 86, 74, 8, 32, 23, 1, 2, 3, 4, 0, 0, 0, 3, 2, 0, NA, NA, 0, NA, 1, 0, 0, NA, 0, 7, 9, 4, 5, 4, 8, 2, 0, 0, NA, 0, 0, 0, 0, 0, 4, 3, 5, 3,
+#> 0, 3, 2, 0, 0, 51, 19, 49, 60, 100, 90, 52, 48, 56, 57, 9, 18, 7, 14, 1, 2, NA, NA, NA, 0, NA, NA, 0, NA, 0, NA, NA, NA, NA, NA, NA, 0, NA, 0, 0, 0, 0, NA, 0, NA, 0, 0, NA, 1, 0, 0, 0, 64, 63, 42, 7, 2, 10, 32, 9, 8, 4, 1, 58, 100, 98, 91, 84, 79, 59, 52, 81, 85, 81, 77, 73, 75, 82, 27, 40, 67, 32, 7, 10, 23, 26, 19, 31, 72, 68, 85, 82, 79, 57, 76, 78, 5, 50, 97, 77, 101, 70, 110, 17, 66, 77, 71, 33, 40, 22, 39, 6, 4, 7, 5, 55, 47, 19, 14, 40, 14, 3, 23, 11, 43, 38, 30, 93, 85, 104, 89, 108, 48,
+#> 32, 30, 26, 14, 64, 53, 79, 96, 98, 88, 123, 113, 146, 123, 123, 67, 118, 96, 102, 100, 94, 79, 68, 0, NA, 0, NA, NA, NA, NA, NA, NA, NA, NA, 1, 0, 0, 0, 0, 0, 2, 40, 66, 40, 69, 52, 73, 59, 8, 3, 38, 58, 27, 57, 14, 26, 10, 12, 23, 28, 26, 7, 1, 24, 55, 96, 79, 49, 10, 68, 45, 37, 10, 71, 24, 15, 2, 3, 1, 1, 3, 5, 2, 0, 4, 2, 5, NA, NA, NA, 0, NA, NA, 0, NA, 2, 4, 1, 8, 6, 5, 2, 4, 4, 5, 1, 0, 1, 0, 20, 50, 75, 83, 92, 58, 42, 10, 0, 1, 60, 10, 22, 24, 44, 32, 53, 63, 45, 19, 44, 17, 21, 8, 22,
+#> 15, 11, 5, 3, 1, 94, 93, 73, 89, 56, 35, 75, 33, 41, 142, 91, 54, 22, 73, 74, 83, 92, 27, 6, 61, 91, 76, 83, 113, 94, 52, 125, 125, 120, 123, 100, 57, 17, 34, 49, 85, 62, 78, 16, 51, 44, 6, 72, 99, 97, 96, 104, 95, 109, 129, 89, 109, 122, 123, 120, 91, 129, 129, 117, 111, 129, 8, 74, 75, 0, 3, 13, 6, 1, 8, 6, 5, 5, 8, 6, 3, 4, 7, 2, 3, 6, 2, 5, 4, 2, 1, 2, 0, 1, 0, 2, 4, 14, 73, 64, 50, 3, 39, 32, 30, 33, 7, 0, 0, 0, 0, 0, 0, NA, NA, 0, 0, 1, 1, 0, 0, 3, 0, 0, 0, 0, 0, 0, 0, 0, NA, 0, NA, NA, NA,
+#> NA, NA, NA, 0, NA, 7, 76, 67, 78, 90, 61, 73, 23, 84, 94, 75, 46, 43, 58, 54, 6, 7, 30, 24, 104, 102, 80, 80, 67, 70, 55, 30, 40, 48, 1, 28, 17, 31, 87, 72, 58, 105, 74, 53, 69, 86, 72, 98, 43, 58, 29, 17, 8, 27, 31, 3, 29, 47, 36, 44, 29, 40, 46, 39, 19, NA, NA, NA, NA, 2, 0, 3, 7, 3, 5, 4, 1, 0, 0, 0, 6, 6, 5, 1, 11, 3, 4, 6, 8, 6, 3, 3, 5, 4, 0, 4, 5, 2, 6, 3, 2, 84, 82, 80, 88, 105, 109, 78, 71, 132, 64, 86, 138, 111, 113, 73, 42, 34, 14, 4, 5, 48, 92, 85, 85, 57, 79, 96, 27, 84, 88, 61, 70,
+#> 68, 11, 31, 19, 8, 17, 3, 20, 38, 33, 31, 21, 17, 48, 4, 7, NA, 1, NA, 0, NA, NA, NA, NA, NA, NA, 0, 5, 82, 75, 80, 78, 85, 85, 75, 59, 61, 72, 52, 60, 34, 1, 4, 8, 4, 4, 4, 5, 1, 2, 1, 1, NA, 0, NA, NA, 0, NA, 0, 0, 0, 78, 104, 82, 85, 107, 140, 117, 117, 120, 75, 66, 41, 79, 87, 76, 104, 88, 111, 109, 124, 143, 152, 126, 94, 109, 104, 11, 39, 104, 108, 106, 106, 102, 110, 110, 109, 74, 115, 8, 77, 87, 53, 19, 77, 63, 20, 7, 6, 32, 64, 108, 83, 85, 84, 79, 89, 97, 92, 70, 70, 84, 76, 36, 15, 9,
+#> 85, 26, 107, 101, 74, 113, 79, 74, 68, 60, 107, 15, 54, 31, 15, 58, 4, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 0, 24, 39, 56, 56, 56, 116, 98, 88, 116, 66, 70, 67, 90, 72, 71, 74, 50, 33, 11, 41, 14, 32, 14, 65, 74, 72, 87, 72, 86, 55, 97, 88, 87, 92, 107, 75, 66, 43, 13, 21, 82, 52, 46, 53, 38, 33, 34, 5, 4, 4, 59, 59, 85, 85, 76, 96, 58, 143, 113, 108, 64, 107, 95, 86, 22, 29, 66, 1, 6, 7, 7, 7, 2, 6, 5, 3, 10, 4, 11, 0, 0, 0, 0, 1, 5, 1, 0, 0, 1, 93, 50, 8, 35, 51, 13, 0, 63, 74, 51, 83, 84, 86,
+#> 59, 74, 84, 42, 52, 37, 8, 6, 0, 20, 71, 98, 100, 20, 47, 121, 121, 104, 86, 86, 100, 80, 42, 72, 45, 6, 11, 78, 77, 105, 57, 57, 89, 87, 110, 114, 69, 97, 38, 49, 17, 0, 32, 65, 87, 98, 66, 79, 90, 90, 74, 45, 93, 34, 42, 12, 34, 67, 25, 87, 33, 34, 61, 46, 118, 86, 21, 52, 103, 105, 98, 82, 126, 117, 104, 22, 107, 52, 44, 1, 14, 18, 10, 13, 29, 62, 36, 80, 90, 43, 44, 3, 22, 46, NA, NA, NA, NA, NA, NA, 7, 4, 55, 48, 82, 76, 72, 35, 7, 48, 49, 8, 0, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA,
+#> NA, NA, NA, 0, NA, NA, NA, 0, 0, 0, NA, 0, NA, 0, NA, 0, 0, 0, 15, 22, 36, 22, 47, 38, 24, 1, 14, 6, 6, 3, 17, 12, 2, 1, 1, 0, 1, 3, 6, 12, 9, 96, 116, 105, 93, 132, 90, 101, 110, 107, 91, 68, 30, 39, 58, 51, 67, 79, 24, 62, 45, 19, 42, 49, 68, 39, 87, 98, 89, 86, 112, 101, 84, 85, 43, 82, 66, 88, 54, 24, 17, 36, 18, 13, 73, 62, 66, 91, 67, 74, 54, 85, 13, 51, 35, 0, 12, 14, 0, 16, 24, 48, 30, 21, 5, 9, 22, 30, 17, 16, 42, 73, 99, 104, 96, 80, 106, 74, 57, 92, 67, 56, 57, 82, 78, 8, 3, 14, 23, 33,
+#> 93, 96, 87, 102, 68, 79, 65, 89, 79, 132, 87, 59, 3, 11, 2, 43, 64, 68, 109, 47, 72, 59, 90, 91, 107, 84, 91, 85, 64, 16, 29, 18, NA, NA, NA, 0, 3, 3, 0, 3, 1, 4, 3, 5, 2, 0, 4, 7, 4, 0, 0, 0, 0, 0, 0, 0, NA, NA, NA, NA, NA, 0, 0, 0, 0, 0, 8, 93, 67, 111, 90, 95, 84, 60, 108, 63, 84, 78, 15, 30, 5, 81, 64, 82, 87, 104, 1, 20, 67, 100, 90, 81, 69, 37, 47, 41, 39, 33, 46, 80, 92, 105, 81, 87, 54, 5, 53, 46, 4, 6, 17, 31, 6, 18, 4, 34, 21, 9, 21, 25, 24, 70, 54, 63, 73, 45, 16, 25, 49, 59, 22, 11, 22,
+#> 1, 60, 81, 93, 90, 121, 124, 90, 113, 108, 71, 40, 77, 86, 57, 27, 39, 106, 48, 53, 143, 68, 37, 21, NA, 0, 2, 9, 7, 3, 5, NA, NA, NA, NA, NA, NA, 0, 1, 1, 0, 0, 0, 4, 41, 38, 84, 70, 19, 47, 55, 15, 7, 95, 63, 44, 18, 7, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 2, 64, 20, 31, 47, 15, 13, 63, 91, 98, 95, 85, 98, 78, 88, 39, 51, 27, 56, 2, 8, 17, 4, 0, 53, 70, 81, 48, 87, 88, 104, 82, 79, 50, 83, 106, 67, 52, 51, 4, NA, NA, NA, NA, 3, 2, 4, 1, 4, 4, 4, 1, 4, 0, 6, 0, 17, 56, 65, 64, 29, 82, 58, 35,
+#> 18, 46, 30, 1, 21, 57, 6, 2, 3, 10, 75, 60, 72, 84, 46, 30, 54, 53, 75, 44, 75, 13, 55, 42, 43, 11, 23, 2, 1, 0, NA, NA, NA, NA, 0, NA, NA, NA, NA, 1, 1, 1, 4, 2, 4, 2, 1, 0, 0, 0, 2, 1, 1, 60, 22, 80, 69, 81, 65, 93, 82, 43, 47, 48, 62, 40, 5, 0, 10, 5, 71, 52, 65, 68, 75, 63, 74, 109, 92, 87, 45, 42, 12, 24, 5, 40, 34, 43, 13, 31, 58, 52, 24, 51, 18, 49, 42, 5, 35, 46, 84, 84, 69, 64, 104, 126, 101, 92, 100, 100, 66, 82, 82, 61, 31, 41, 66, 9, 21, 42, 86, 65, 98, 118, 91, 107, 63, 93, 67, 10, NA,
+#> NA, 0, NA, NA, NA, NA, 0, NA, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, NA, NA, NA, NA, 0, 0, NA, 0, NA, NA, NA, 0, NA, 0, 81, 97, 44, 52, 62, 23, 61, 55, 5, 2, 1, 3, 1, 3, 3, 0, 0, 3, 4, 2, 0, 0, 5, 51, 85, 94, 99, 108, 131, 92, 93, 84, 117, 108, 112, 79, 84, 66, 36, 62, 6, 32, 0, 21, 50, 53, 108, 84, 95, 113, 58, 6, 8, 18, 1, 1, 36, 16, 82, 97, 94, 108, 83, 22, 62, 7, 56, 65, 93, 53, 2, 24, 1, 13, 40, 53, 37, 93, 74, 102, 114, 81, 97, 104, 13, 67, 45, 19, 8, 72, 39, 41, 92, 59, 89, 84, 90, 134, 114,
+#> 106, 146, 122, 99, 69, 39, 53, 7, 8, 28, 58, 92, 122, 104, 89, 101, 106, 101, 101, 111, 97, 26, 108, 79, 93, 55, 0, 48, 11, 21, 8, 9, 5, 35, 120, 73, 82, 115, 34, 129, 95, 96, 89, 102, 88, 52, 39, 47, 6, 6, 38, NA, NA, NA, NA, NA, NA, 0, 0, 1, 0, 0, 2, 0, 0, 0, 0, 0, 0, 0, 0, 2, 1, 7, 1, 1, NA, 2, 1, 0, 0, 6, 62, 90, 66, 91, 49, 52, 83, 92, 43, 84, 75, 74, 64, 49, 45, 12, 43, 39, 67, 80, 93, 108, 107, 101, 116, 108, 102, 102, 77, 105, 53, 65, 17, 35, 84, 108, 106, 92, 91, 109, 100, 108, 112, 86,
+#> 80, 79, 24, 54, 22, 52, NA, NA, NA, NA, NA, NA, 0, 0, 0, 4, 0, 0, 0, 0, 0, 8, 28, 27, 16, 64, 69, 91, 74, 86, 107, 104, 33, 37, 50, 4, 3, 1, 27, 37, 56, 52, 73, 34, 60, 45, 31, 89, 83, 47, 30, 6, 1, 2, 0, 0, 0, 0, NA, 0, 1, 0, 0, 0, 0, 1, 1, 0, 2, 1, 0, 0, 0, 0, 0, 0, 0, 0, 5, 104, 116, 127, 134, 119, 110, 124, 87, 111, 122, 118, 102, 88, 107, 111, 84, 99, 8, 47, 16, 64, 39, 23, 39, 39, 42, 21, 39, 16, 32, 28, 3, 23, 6, 21, 4, 15, 141, 100, 123, 110, 134, 133, 125, 124, 112, 124, 113, 143, 104, 78,
+#> 74, 67, 74, 21, 83, 9, 82, 37, 68, 113, 78, 28, 78, 73, 98, 98, 57, 71, 9, 55, 22, 19, 1, NA, NA, NA, 0, 0, 0, 0, 0, 0, 0, 1, 4, 0, 0, 1, 0, 0, 0, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 3, 2, 1, 1, 1, 2, 3, 2, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 2, 5, 5, 0, 0, 0, 0, 1, 0, 0, 2, 2, 1, 3, 0, 9, 32, 75, 76, 72, 115, 84, 124, 82, 89, 110, 95, 98, 96, 102, 98, 99, 92, 68, 47, 51, 35, 46, 49, 10, 31, 53, 14, 2, 1, 2, 3, 5, 1, 6, 7, 6, 2, 2, 7, 0, 6, 9, 1, 0, 0, 1,
+#> 2, 3, 0, 0, NA, NA, NA, 1, 1, NA, 2, 0, 0, 0, 0, 0, 0, 0, 11, 122, 111, 103, 104, 13, 101, 120, 24, 28, 28, 82, 39, 24, 17, 10, 93, 120, 74, 88, 96, 52, 37, 98, 109, 28, 94, 55, 58, 24, 52, 66, 31, 26, 4, 11, 53, 48, 42, 92, 82, 96, 92, 95, 69, 89, 63, 66, 63, 43, 11, 7, 63, 46, 49, 61, 110, 56, 60, 48, 90, 49, 41, NA, 0, 0, 2, 5, 0, 3, 6, 2, 1, 1, 0, 6, 5, 0, NA, NA, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, NA, NA, NA, NA, NA, NA, NA, NA, 2, NA, NA, NA, 0, 0, 0, 0, 0, 0, 2, 1, 0, 0, 2,
+#> 1, 9, 13, 26, 31, 69, 73, 59, 86, 64, 57, 57, 15, 31, 59, 63, 56, 40, 76, 102, 61, 118, 88, 111, 74, 3, 30, 11, 60, 89, 97, 122, 104, 91, 101, 85, 95, 107, 83, 21, 43, 41, 27, 27, NA, NA, NA, NA, NA, 4, 5, 4, 0, 0, 1, 0, 0, 0, 0, NA, NA, 0, 0, NA, NA, NA, 0, NA, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 12, 94, 80, 92, 72, 62, 28, 2, 28, 1, 3, 6, 3, 5, 4, 2, 0, 0, 0, 0, 0, 0, 0, 0, 0, 14, 33, 41, 35, 4, 10, 97, 84, 83, 76, 77, 29, 8, 26, 37, 24, 24, 33, 0, 38, 74, 88, 50, 30, 98, 23, 47, 84, 92, 73,
+#> 34, 0, 3, 18, 51, 81, 77, 97, 59, 67, 78, 20, 60, 112, 104, 83, 74, 28, 8, NA, NA, NA, 0, NA, NA, 0, NA, NA, 1, 4, 4, 1, 2, 2, 2, 4, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 4, 1, 0, 1, 52, 52, 57, 106, 134, 98, 121, 110, 84, 92, 87, 59, 14, 62, 48, 20, 85, 76, 50, 46, 9, 32, 6, 1, 21, 59, 39, 84, 55, 21, 46, 68, 58, 48, 22, 6, 1, 44, 103, 69, 69, 56, 71, 101, 75, 17, 30, 40, 14, 2, 87, 114, 100, 123, 116, 118, 113, 90, 103, 69, 66, 87, 108, 82, 80, 47, 56, 58, 1, 19, 20, 18, 30, 0, 0, 6, 26, 14, 3, 0, 0, 0,
+#> 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 12, 112, 49, 106, 114, 102, 70, 51, 83, 127, 93, 116, 50, 21, 61, 17, 83, 79, 46, 57, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 7, 68, 79, 94, 113, 115, 102, 103, 117, 74, 81, 89, 71, 96, 15, 26, 36, 84, 94, 123, 109, 64, 78, 56, 66, 36, 1, 4, 2, 44, 108, 102, 101, 107, 106, 71, 124, 95, 92, 89, 85, 59, 83, 60, 0, 0, 7, 9, 6, 3, 10, 7, 20, 9, 6, 7, 4, 3, 6, 0, 3, 3, 4, NA, NA, 0, NA, NA, NA, NA, NA, 0, 0, 0, 0, 0, 0, 1, 0, 0, 1, 0, 4, 4, 2, 1, 1, NA, NA, NA,
+#> 0, 6, 4, 6, 0, 0, 0, 1, 1, 0, 0, 0, 3, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, NA, NA, NA, NA, NA, NA, NA, 0, 8, 6, 3, NA, 0, 6, 0, 32, 26, 24, 96, 107, 50, 41, 74, 28, 87, 74, 103, 68, 96, 78, 34, 99, 84, 84, 121, 89, 99, 35, 79, 86, 8, 33, 49, 13, NA, 0, 0, NA, NA, NA, NA, NA, 0, 1, 2, 0, 0, 0, 0, 1, 1, 0, 0, 0, 0, 3, 13, 31, 29, 24, 16, 43, 40, 31, 43, 28, 42, 10, 4, 46, 80, 108, 92, 65, 18, 65, 27, 12, 28, 59, 27, 4, 5, 13, 78, 114, 138, 132, 107, 135, 115, 92, 94, 86, 39, 79, 48, 59, 31, 41, 27,
+#> 84, 66, 92, 115, 108, 109, 120, 97, 33, 74, 92, 31, 68, 4, 39, 17, 20, 7, 21, 3, 16, 36, 65, 53, 65, 16, 45, 90, 94, 86, 114, 84, 102, 77, 96, 100, 61, 78, 42, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 87, 39, 95, 130, 103, 100, 113, 87, 34, 92, 66, 15, 29, 69, 4, 19, 85, 120, 100, 99, 53, 47, 78, 105, 60, 69, 2, 52, 0, 1, 29, 56, 50, 92, 59, 79, 83, 72, 67, 65, 91, 18, 55, 49, 34, 12, 70, 100, 102, 97, 116, 95, 32, 38, 82, 117, 72, 54,
+#> 56, 33, 68, 90, 79, 92, 94, 54, 77, 96, 84, 100, 100, 87, 69, 50, 26, 34, 1, 34, 0, 77, 60, 67, 13, 34, 36, 37, 26, 37, 0, 6, 47, 89, 91, 87, 94, 87, 92, 74, 43, 10, 0, 10, 16, 36, 28, 6, 4, 1, 63, 53, 93, 96, 99, 84, 74, 76, 47, 88, 88, 69, 78, 24, 9, 18, 0, 0, 52, 44, 82, 89, 83, 79, 63, 86, 94, 85, 74, 76, 80, 81, 90, 71, 67, 127, 111, 111, 101, 111, 110, 111, 103, 88, 74, 80, 28, 49, 57, 42, 45, 5, 20, 46, 94, 37, 101, 17, 81, 95, 75, 35, 21, 18, 45, 44, 30, 16, 45, 62, 62, 75, 45, 57, 43, 38,
+#> 35, 37, 38, 15, 9, 4, 4, 44, 48, 47, 64, 64, 95, 33, 41, 70, 95, 101, 93, 42, 41, 64, 35, 4, 0, 0, 20, 43, 4, 20, 23, 76, 63, 40, 59, 85, 56, 31, 31, 61, 16, 19, NA, NA, NA, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 112, 118, 137, 133, 129, 119, 99, 100, 124, 115, 105, 85, 49, 89, 85, 1, 51, 40, 82, 57, 34, 35, 70, 78, 84, 112, 106, 128, 90, 92, 69, 90, 93, 70, 30, 4, 27, 16, 54, 68, 67, 114, 76, 65, 22, 27, 61, 61, 40, 33, 10, 0, 0, 0, 0, 2, 3, 5, 0, 0, 0, NA, 0, 0, 0, 0, 0, 0, 0, 0, 0, 12, 82,
+#> 48, 65, 71, 70, 49, 50, 27, 42, 65, 43, 36, 22, 3, 32, 42, 12, 39, 5, 1, 3, 8, 5, 17, 9, 0, 0, 0, 0, 0, 0, 0, 2, 1, 2, 1, 0, 3, 3, 0, 0, 8, 59, 31, 34, 37, 36, 45, 44, 38, 46, 52, 17, 10, NA, 0, NA, 0, 0, 1, 1, 1, 2, 0, 0, 0, 0, 10, 53, 93, 105, 107, 108, 98, 107, 89, 99, 72, 92, 83, 40, 31, 28, 15, 0, 0, 0, 0, 0, 0, 0, 99, 74, 66, 79, 8, 35, 25, 59, 13, 18, 38, 24, 9, 2, 2, 6, 3, 3, 0, 3, 1, 0, 0, 2, 5, 77, 128, 114, 77, 102, 119, 97, 76, 64, 67, 50, 68, 47, 37, 22, 0, 50, 79, 76, 62, 88, 92, 83,
+#> 93, 80, 57, 68, 63, 67, 66, 52, 8, 0, 0, 0, 0, 0, 0, 0, 0, 0, 3, 5, 2, 4, 6, 6, 4, 0, 0, 0, 1, 0, 3, 2, 5, 2, 1, 0, 1, 0, 0, 0, 0, 0, 4, NA, 0, 0, 0, 0, 2, 0, 0, 0, 0, 0, 0, 6, 3, 4, 0, 1, 1, 3, 0, 0, 0, 0, 0, 0, 0, 0, 9, 62, 21, 70, 83, 95, 91, 90, 120, 30, 91, 93, 91, 17, 63, 39, 16, 26, 27, 21, 76, 101, 76, 86, 99, 91, 72, 84, 54, 37, 46, 77, 28, 28, 31, 55, 63, 91, 92, 64, 90, 76, 23, 0, 23, 34, 37, 6, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 8, 8, 92, 72, 68, 45, 0, 26, 6, 4, 2, 5, 14, 8, 11, 0,
+#> 0, 1, 0, 2, 31, 51, 93, 61, 97, 38, 51, 0, 85, 75, 69, 12, 8, 0, 14, 87, 118, 82, 78, 91, 85, 63, 84, 79, 60, 36, 45, 19, 24, 67, 101, 82, 103, 77, 51, 38, 52, 78, 28, 1, 32, 73, 65, 88, 76, 87, 56, 79, 79, 58, 54, 23, 36, 27, 101, 61, 104, 87, 52, 2, 5, 2, 6, 9, 6, 2, 2, 1, 1, 5, 5, 11, 2, 0, 3, 0, 0, 10, 47, 1, 59, 46, 52, 79, 94, 119, 115, 116, 74, 77, 86, 84, 65, 84, 59, 73, 0, 0, 0, 0, 0, 1, 0, 2, 5, 1, 2, 0, 19, 43, 47, 90, 48, 4, 10, 15, 16, 50, 34, 42, 4, 9, 4, 6, 1, 70, 66, 42, 40, 66, 35,
+#> 0, 9, 13, 2, 61, 110, 101, 78, 39, 72, 103, 48, 59, 21, 30, 66, 101, 112, 99, 38, 48, 63, 39, 103, 113, 90, 66, 5, 56, 57, 6, 25, 35, 49, 86, 68, 111, 86, 96, 67, 77, 44, 39, 5, 2, 15, 77, 73, 82, 78, 30, 32, 56, 64, 76, 68, 87, 39, 13, 20, 56, 55, 93, 49, 40, 10, 23, 74, 108, 54, 75, 52, 27, 19, 18, 84, 71, 59, 70, 50, 104, 69, 88, 87, 74, 54, 84, 82, 95, 88, 79, 83, 26, 0, 2, 56, 31, 43, 40, 0, 1, 22, 68, 118, 103, 118, 102, 99, 118, 104, 37, 61, 123, 100, 96, 88, 54, 1, 28, 12, 44, 77, 58, 82,
+#> 60, 70, 67, 24, 26, 11, 17, 3, 22, 4, 0, 7, 14, 71, 84, 92, 81, 49, 84, 98, 97, 71, 59, 75, 89, 69, 66, 41, 15, 9, 72, 73, 80, 61, 60, 118, 48, 84, 84, 79, 84, 69, 23, 0, 1, 0, 2, 1, 2, 1, 2, 3, 3, 2, 4, 2, 4, 1, 1, 1, 3, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 3, 2, NA, 0, 0, 0, 0, 1, 1, 7, 2, 0, 0, 3, 2, 2, 0, 20, 54, 73, 62, 87, 69, 54, 74, 80, 54, 10, 11, 0, 31, 70, 55, 19, 58, 63, 67, 70, 46, 57, 37, 41, 18, 32, 3, 5, 4, 1, 1, 3, 2, 3, 4, 1,
+#> 1, 2, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 5, 52, 104, 94, 105, 105, 87, 81, 28, 34, 65, 53, 0, 14, 69, 51, 86, 67, 36, 11, 6, 3, 53, 28, 42, 41, 33, 55, 48, 54, 23, 6, 9, 3, 39, 101, 106, 112, 91, 85, 96, 111, 111, 109, 103, 101, 64, 66, 107, 75, 82, 100, 103, 85, 60, 42, 93, 61, 65, 67, 66, 24, 29, 0, 3, 6, 0, 6, 10, 8, 9, 8, 7, 1, 0, 3, 0, 3, 0, 2, 21, 35, 28, 35, 97, 55, 43, 70, 30, 34, 44, 44, 2, 50, 4, 8, 42, 18, 65, 107, 92, 85, 103, 107, 110, 28, 18, 2, 33, 40, 32,
+#> 61, 70, 104, 101, 136, 108, 118, 103, 123, 117, 115, 93, 95, 107, 81, 79, 25, 0, 57, 77, 106, 114, 114, 93, 80, 102, 76, 99, 88, 79, 3, 49, 2, 11, 6, 71, 74, 64, 27, 41, 45, 80, 46, 3, 13, 10, 24, 50, 87, 28, 47, 87, 74, 58, 26, 58, 105, 90, 82, 76, 46, 28, 33, 82, 107, 59, 92, 90, 68, 58, 5, 27, 64, 49, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 2, 3, 0, 4, 1, 2, 0, 27, 99, 76, 11, 51, 72, 101, 83, 56, 73, 32, 64, 85, 70, 36, 10, 14, 39, 62, 97, 84, 97, 85, 53, 19, 63, 56, 6, 62, 19, NA, NA, 0,
+#> 1, NA, 0, 0, 0, 0, 0, 3, 3, 5, 4, 4, 2, 4, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 119, 125, 125, 101, 92, 55, 30, 49, 62, 64, 59, 78, 62, 93, 70, 103, 103, 104, 105, 81, 77, 82, 2, 1, 28, 68, 67, 54, 76, 13, 41, 42, 18, 61, 86, 62, 98, 94, 88, 38, 81, 62, 60, 69, 13, 36, 93, 131, 104, 113, 112, 75, 54, 48, 73, 74, 14, 23, 20, 61, 51, 68, 63, 63, 51, 44, 43, 57, 68, 65, 68, 119, 120, 107, 52, 42, 95, 83, 95, 103, 83, 24, 0, 0, 9, 8, 8, 9, 9, 9,
+#> 7, 5, 8, 3, 47, 33, 99, 122, 119, 113, 18, 83, 101, 86, 58, 94, 21, 36, 41, 99, 96, 113, 115, 88, 87, 60, 91, 63, 54, 24, 10, 76, 110, 106, 110, 104, 76, 95, 95, 114, 73, 39, 9, 90, 12, 27, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 6, 31, 12, 51, 89, 37, 3, 99, 76, 91, 64, 72, 72, 38, 0, 4, 3, 38, 81, 63, 68, 68, 25, 78, 72, 61, 19, 57, 15, 0, 0, 1, 0, 1, 0, 0, 1, 3, 1, 0, 0, 0, 0, 0, 0, 4, 4, 5, 5, 6, 8, 4, 0, 2, 0, 0, 1, 1, 0, 0, 1, 5, 38, 11, 100, 85, 91, 99, 77, 68, 25, 47, 12, 15, 111, 134, 118, 101,
+#> 73, 15, 34, 14, 21, 4, 20, 65, 87, 87, 63, 45, 57, 50, 51, 45, 76, 41, 83, 84, 70, 32, 40, 43, 9, 77, 58, 19, 1, 2, 34, 21, 41, 22, 94, 77, 59, 105, 57, 61, 42, 34, 5, 97, 82, 85, 119, 115, 127, 139, 76, 100, 48, 87, 102, 65, 78, 71, 2, 82, 109, 86, 103, 94, 95, 83, 82, 19, 78, 1, 23, 30, 32, 101, 105, 97, 81, 62, 56, 63, 23, 26, 13, 25, 10, 11, NA, NA, NA, NA, NA, NA, 0, NA, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 5, 86, 118,
+#> 115, 53, 102, 81, 91, 72, 46, 91, 92, 113, 101, 109, 108, 30, 68, 87, 9, 7, 0, 7, 2, 2, 0, NA, 0, 0, NA, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 2, 0, 1, 0, 2, 0, 4, 7, 3, 6, 4, 2, 5, 4, 1, 2, 0, 0, 0, 0, 0, 0, 0, 0, 0, 2, 0, 0, 6, 3, 5, 2, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 2, 7, 8, 2, 0, 2, 3, 2, 0, 7, 17, 83, 101, 103, 90, 87, 108, 63, 12, 69, 83, 76, 5, 36, 1, 1, 65, 107, 80, 78, 100, 94, 86, 80, 44, 69, 12, 36, 29, 30, 37, 45, 34, 55, 65, 68, 40, 34, 20, 50, 62, 113, 59, 27, 30, 35, 35, 4,
+#> 76, 10, 8, 5, 70, 78, 102, 102, 84, 95, 26, 46, 82, 14, 10, 9, 23, 2, 19, 83, 51, 31, 44, 99, 72, 93, 72, 97, 46, 61, 80, 92, 43, 47, 25, 18, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 6, 67, 100, 96, 78, 39, 91, 83, 74, 0, 1, 12, 66, 27, 47, 46, 26, 19, 20, 3, 5, 20, 12, 42, 67, 91, 92, 70, 31, 26, 68, 96, 51, 8, 100, 45, 7, 52, 98, 43, 95, 80, 103, 73, 43, 22, 23, 29, 96, 47, 73, 53, 44, 42, 9, 10, 14, 3, 3, 8, 42, 104, 63, 19, 44, 14, 42, 53, 7, 28, 23, 80, 104, 101, 89, 93, 69, 96, 110, 65, 23, 62, 56, 19,
+#> 49, 70, 87, 19, 103, 70, 23, 38, 93, 45, 52, 32, 0, 0, 0, 1, 0, 0, 0, 0, 0, 6, 0, 3, 5, 5, 8, 6, 16, 61, 83, 76, 68, 103, 100, 88, 74, 0, 0, 1, 0, 0, 0, 0, 0, 0, 1, 0, 0, 2, 0, 0, 0, 6, 84, 99, 51, 110, 85, 52, 93, 84, 26, 43, 2, 29, 57, 97, 84, 30, 64, 96, 75, 57, 10, 29, 30, 47, 93, 97, 82, 115, 74, 35, 77, 80, 0, 2, 4, 5, 7, 4, 5, 4, 4, 0, 60, 70, 78, 66, 69, 31, 11, 3, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 84, 60, 33, 10, 10, 50, 64, 8, 34, 48, 93, 57, 56, 28, 67, 38, 72, 50, 50,
+#> 90, 92, 71, 67, 79, 54, 29, 54, NA, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 82, 109, 108, 32, 100, 43, 62, 55, 58, 7, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 4, 0, 0, 1, 1, 0, 0, 2, 4, 6, 2, 2, 4, 4, 4, 2, 0, 3, 0, 0, 0, 1, 1, 0, 0, 0, 1, 0, 0, 2, 21, 41, 54, 85, 61, 26, 18, 18, 27, 31, 53, 111, 92, 89, 72, 35, 87, 2, 0, 0, 0, 0, 0, 5, 5, 4, 4, 5, 1, 4, 0, 5, 15, 104, 48, 101, 89, 81, 33, 72, 71, 46, 31, 3, 1, 1, 1, 3, 58, 75, 38, 7, 54, 109, 105, 64, 82, 101, 108, 11, 69, 82, 106, 101, 59, 101, 32, 95, 1, 1,
+#> 0, 30, 4, 35, 59, 73, 60, 11, 54, 70, 33, 15, 3, 0, 3, NA, NA, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 58, 17, 78, 61, 72, 74, 65, 71, 83, 81, 59, 68, 82, 54, 105, 113, 97, 84, 100, 88, 86, 60, 13, 1, 12, 5, 0, 6, 7, 10, 3, 4, 1, 0, 1, 15, 35, 19, 75, 60, 64, 86, 49, 87, 90, 3, 28, 41, 70, 53, 53, 53, 20, 98, 94, 10, 119, 43, 92, 71, 66, 1, 2, 4, 10, 2, 8, 5, 2, 35, 37, 72, 67, 59, 13, 24, 60, 72, 28, 34, 101, 93, 90, 87, 40,
+#> 72, 97, 106, 94, 79, 72, 59, 89, 81, 73, 5, 18, 53, 70, 69, 71, 67, 68, 77, 74, 59, 31, 55, 58, 79, 51, 13, 30, 53, 38, 44, 78, 77, 74, 72, 62, 57, 63, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 3, 0, 0, 0, 0, 0, 0, 9, 28, 63, 42, 39, 44, 21, 2, 18, 90, 122, 112, 91, 76, 136, 102, 31, 73, 98, 30, 48, 81, 39, 87, 70, 66, 54, 20, 66, 17, 52, 84, 73, 105, 107, 94, 77, 85, 0, 1, 0, 5, 1, 0, 0, 16, 65, 80, 50, 77, 28, 26, 54, 22, 8, 27, 20, 1, 75, 66, 42, 66, 50, 102, 84, 39, 81, 70, 24, 79, 61, 55, 59,
+#> 52, 68, 43, 0, 0, 0, 0, 0, 1, 0, 7, 0, 3, 2, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 5, 5, 41, 85, 54, 53, 67, 46, 13, 89, 78, 53, 44, 76, 85, 66, 56, 45, 45, 53, 89, 71, 66, 30, 2, 46, 75, 15, 76, 70, 73, 41, 12, 66, 73, 49, 18, 6, 0, 4, 1, 34, 62, 77, 43, 95, 59, 28, 27, 74, 74, 94, 87, 107, 97, 89, 91, 83, 50, 93, 67, 74, 79, 2, 10, 50, 48, 52, 49, 76, 100, 92, 59, 47, 40, 57, 1, 20, 129, 109, 115, 104, 98, 71, 41, 118, 1, 3, 12, 51, 54, 63, 45, 61, 65, 54,
+#> 66, 57, 43, 38, 68, 48, 19, 6, 38, 2, 3, 62, 75, 54, 70, 54, 69, 85, 42, 14, 34, 0, 0, 63, 47, 80, 84, 89, 89, 71, 72, 0, 1, 4, 2, 3, 1, 9, 59, 65, 72, 77, 73, 69, 0, 0, 0, 0, 0, 0, 0, 0, 1, 4, 0, 0, 0, 0, 0, 4, 66, 65, 86, 54, 98, 24, 88, 38, 102, 20, 38, 48, 57, 52, 28, 82, 103, 75, 103, 49, 58, 97, 14, 79, 51, 38, 37, 72, 80, 95, 19, 42, 17, 76, 44, 60, 0, 1, 5, 50, 37, 40, 5, 1, 2, 51, 48, 7, 16, 9, 75, 103, 65, 100, 0, 44, 126, 99, 101, 42, 18, 64, 70, 46, 60, 1, 12, 14, 49, 55, 102, 87, 30,
+#> 93, 93, 70, 53, 74, 32, 44, 17, 4, 27, 54, 55, 101, 9, 44, 71, 89, 94, 0, 0, 2, 2, 3, 2, 0, 1, 0, 0, 0, 1, 58, 70, 46, 9, 27, 56, 7, 7, 0, 0, 1, 0, 0, 22, 62, 79, 71, 85, 1, 0, 1, 0, 3, 26, 39, 59, 85, 35, 46, 47, 34, 94, 63, 45, 79, 75, 62, 89, 47, 0, 2, 5, 4, 3, 10, 9, 80, 88, 3, 3, 26, 80, 64, 85, 86, 9, 45, 61, 38, 10, 38, 63, 63, 66, 94, 68, 5, 57, 76, 62, 62, 74, 69, 40, 111, 43, 2, 20, 57, 69, 68, 57, 74, 76, 0, 2, 1, 0, 0, 0, 0, 0, 3, 5, 0, 35, 62, 70, 74, 27, 62, 62, 39, 2, 29, 90, 78, 34,
+#> 38, 9, 92, 88, 8, 64, 41, 111, 18, 83, 73, 84, 22, 44, 52, 54, 65, 1, 34, 89, 93, 122, 24, 60, 49, 62, 92, 79, 56, 52, 87, 21, 12, 7, 86, 29, 61, 64, 12, 16, 81, 29, 34, 24, 57, 93, 7, 60, 84) x c(54, 77, 50, 59, 50, 62, 62, 2, 4, 48, 3, 12, 60, 80, 101, 101, 73, 92, 146, 115, 103, 117, 132, 148, 111, 152, 147, 144, 148, 72, 22, 58, 94, 90, 94, 81, 117, 118, 48, 93, 77, 3, 59, 78, 108, 83, 58, 60, 40, 17, 23, 39, 17, 15, 82, 72, 190, 225, 177, 179, 174, 167, 105, 10, 35, 43, 57, 50, 27, 35, 42, 23, 23, 10, 2, 5, 10, 18, 4, 22, 61, 49, 52, 40, 54, 43, 42, 13, 14, 27, 11, 18, 79, 54, 54, 57, 52, 44, 40, 29, 1, 84, 172, 191, 180, 184, 203, 237, 187, 158, 187, 169, 164, 55, 86, 13, 12, 0, 8,
+#> 29, 31, 44, 40, 30, 52, 34, 39, 32, 22, 32, 34, 44, 33, 18, 16, 27, 26, 21, 8, 2, 1, 57, 197, 197, 118, 152, 232, 132, 1, 167, 208, 82, 214, 152, 168, 152, 227, 115, 165, 156, 108, 137, 105, 0, 8, 14, 25, 0, 32, 14, 17, 20, 14, 12, 10, 5, 1, 2, 28, 26, 28, 30, 30, 24, 20, 20, 25, 25, 22, 29, 19, 23, 8, 3, 0, 116, 193, 143, 104, 134, 152, 166, 143, 110, 31, 101, 55, 165, 184, 167, 78, 116, 6, 145, 166, 72, 49, 180, 152, 144, 13, 97, 0, 31, 80, 66, 78, 62, 68, 61, 63, 62, 3, 41, 45, 36, 13, 0, 20,
+#> 65, 90, 64, 21, 85, 65, 83, 59, 82, 43, 26, 55, 19, 0, 0, 39, 101, 170, 185, 184, 143, 171, 166, 188, 184, 185, 170, 217, 189, 193, 183, 183, 92, 18, 0, 189, 208, 191, 165, 89, 144, 9, 9, 14, 25, 27, 18, 30, 34, 33, 5, 1, 4, 0, 1, 12, 22, 10, 13, 21, 13, 15, 8, 4, 17, 3, 0, 23, 28, 30, 38, 25, 11, 29, 13, 9, 10, 12, 1, 1, 0, 1, 36, 113, 212, 188, 216, 194, 248, 226, 167, 127, 208, 201, 225, 161, 191, 143, 197, 211, 189, 211, 157, 79, 175, 114, 2, 21, 35, 173, 160, 170, 130, 178, 141, 136, 149, 159,
+#> 123, 138, 123, 96, 131, 95, 78, 31, 16, 3, 5, 1, 15, 133, 129, 149, 136, 135, 130, 128, 71, 126, 48, 6, 0, 79, 64, 51, 142, 114, 100, 114, 83, 127, 57, 65, 63, 36, 37, 69, 45, 15, 70, 123, 146, 110, 83, 107, 95, 117, 80, 54, 14, 80, 57, 86, 90, 162, 41, 174, 84, 37, 216, 38, 198, 70, 4, 77, 5, 83, 191, 168, 202, 184, 206, 110, 171, 145, 150, 85, 157, 129, 145, 146, 158, 113, 127, 1, 0, 1, 15, 19, 13, 20, 13, 25, 22, 18, 23, 9, 11, 4, 15, 24, 4, 15, 21, 12, 23, 21, 25, 21, 9, 9, 1, 80, 176, 192, 201,
+#> 194, 176, 182, 171, 199, 175, 180, 201, 168, 178, 158, 181, 124, 139, 155, 124, 61, 34, 47, 117, 180, 160, 209, 122, 127, 154, 140, 144, 158, 154, 151, 149, 88, 97, 20, 136, 141, 94, 136, 127, 125, 122, 114, 35, 163, 127, 137, 73, 52, 16, 41, 0, 0, 17, 29, 12, 20, 23, 24, 27, 20, 20, 14, 17, 14, 11, 14, 13, 11, 23, 12, 6, 6, 6, 3, 3, 9, 18, 3, 0, 24, 135, 158, 98, 91, 142, 168, 173, 146, 138, 112, 137, 68, 45, 32, 22, 77, 3, 8, 90, 198, 188, 180, 189, 184, 181, 173, 168, 163, 91, 165, 224, 177, 194,
+#> 182, 194, 147, 129, 76, 10, 0, 1, 23, 35, 83, 85, 67, 70, 62, 45, 19, 17, 4, 2, 0, 23, 81, 86, 52, 48, 16, 0, 3, 26, 168, 183, 167, 222, 189, 193, 176, 211, 184, 150, 146, 214, 183, 161, 218, 167, 167, 164, 171, 51, 18, 35, 25, 31, 29, 17, 26, 16, 21, 11, 18, 24, 8, 9, 24, 15, 4, 4, 13, 13, 24, 30, 38, 35, 30, 34, 32, 33, 40, 24, 17, 30, 22, 18, 32, 42, 20, 16, 39, 35, 45, 35, 32, 34, 32, 27, 33, 28, 25, 7, 4, 24, 1, 0, 9, 18, 23, 36, 15, 6, 14, 0, 125, 49, 37, 71, 150, 20, 145, 130, 130, 118, 150,
+#> 150, 128, 124, 163, 117, 124, 133, 113, 18, 32, 9, 24, 46, 84, 111, 135, 125, 65, 72, 33, 78, 88, 17, 14, 1, 0, 2, 2, 16, 26, 12, 33, 16, 12, 6, 3, 17, 13, 16, 16, 15, 2, 7, 2, 41, 55, 44, 67, 69, 144, 140, 124, 151, 112, 123, 88, 88, 21, 1, 5, 0, 1, 117, 34, 114, 143, 151, 149, 128, 136, 166, 151, 153, 143, 92, 64, 29, 131, 152, 75, 14, 1, 0, 3, 6, 12, 11, 12, 23, 1, 9, 14, 0, 0, 7, 68, 50, 126, 100, 150, 155, 129, 34, 15, 19, 148, 81, 5, 8, 23, 40, 31, 57, 50, 81, 30, 15, 0, 0, 12, 47, 43, 53,
+#> 94, 93, 55, 26, 4, 16, 8, 56, 14, 29, 45, 28, 1, 3, 21, 11, 10, 19, 0, 22, 18, 20, 25, 23, 11, 20, 25, 13, 9, 12, 9, 16, 12, 8, 0, 3, 5, 60, 81, 98, 109, 98, 64, 75, 45, 0, 6, 7, 9, 101, 180, 159, 165, 144, 141, 172, 128, 142, 144, 171, 160, 101, 63, 44, 119, 35, 3, 21, 12, 2, 2, 2, 1, 9, 165, 159, 198, 200, 190, 182, 97, 156, 154, 166, 97, 65, 0, 66, 57, 133, 103, 54, 77, 67, 69, 61, 47, 29, 55, 1, 14, 17, 13, 4, 6, 7, 2, 12, 3, 3, 3, 29, 233, 226, 197, 153, 43, 99, 202, 162, 23, 181, 218, 77, 41,
+#> 86, 95, 86, 66, 108, 105, 80, 81, 43, 33, 21, 10, 27, 2, 61, 104, 130, 133, 118, 109, 67, 59, 28, 17, 24, 19, 13, 32, 22, 33, 30, 1, 12, 27, 29, 15, 24, 15, 19, 7, 6, 23, 25, 2, 0, 146, 176, 172, 178, 156, 164, 151, 122, 122, 148, 168, 158, 205, 146, 114, 59, 116, 172, 164, 163, 184, 135, 140, 189, 15, 118, 121, 67, 110, 134, 1, 9, 83, 132, 167, 90, 97, 154, 84, 172, 139, 97, 17, 10, 0, 8, 3, 17, 21, 23, 15, 1, 6, 9, 15, 13, 6, 10, 19, 14, 12, 3, 3, 11, 22, 150, 186, 176, 181, 143, 151, 172, 115,
+#> 134, 166, 179, 164, 191, 169, 57, 38, 0, 3, 11, 117, 140, 163, 133, 143, 111, 152, 133, 132, 157, 185, 187, 134, 20, 10, 20, 33, 42, 49, 34, 24, 17, 67, 62, 99, 43, 27, 18, 111, 2, 56, 3, 12, 9, 82, 130, 110, 134, 67, 138, 83, 64, 4, 1, 2, 33, 50, 95, 164, 207, 140, 167, 138, 116, 41, 174, 126, 113, 14, 96, 81, 152, 153, 170, 119, 119, 80, 155, 137, 132, 53, 136, 16, 120, 155, 148, 163, 175, 154, 150, 96, 85, 12, 21, 28, 24, 18, 14, 7, 55, 88, 89, 90, 90, 55, 101, 118, 134, 130, 75, 104, 40, 94,
+#> 84, 70, 59, 16, 14, 4, 4, 18, 12, 2, 6, 9, 15, 7, 10, 21, 1, 3, 5, 30, 88, 126, 117, 126, 125, 113, 65, 43, 67, 83, 26, 13, 156, 134, 129, 33, 71, 9, 0, 124, 179, 149, 149, 127, 141, 99, 73, 13, 31, 172, 153, 138, 161, 170, 136, 177, 113, 137, 159, 191, 182, 201, 131, 212, 221, 119, 80, 18, 98, 106, 110, 95, 96, 73, 111, 131, 105, 124, 87, 30, 94, 60, 6, 1, 0, 15, 10, 14, 17, 9, 8, 11, 12, 14, 4, 10, 18, 141, 144, 124, 142, 146, 12, 128, 131, 180, 198, 161, 158, 62, 55, 7, 88, 159, 157, 146, 134,
+#> 104, 10, 12, 82, 78, 71, 75, 85, 106, 82, 67, 96, 79, 74, 45, 55, 30, 2, 0, 1, 15, 173, 170, 169, 174, 180, 135, 162, 181, 181, 180, 168, 86, 102, 12, 33, 1, 0, 48, 131, 149, 36, 80, 66, 9, 15, 11, 0, 7, 14, 12, 6, 5, 13, 112, 0, 131, 170, 149, 182, 158, 139, 164, 118, 113, 135, 157, 15, 8, 10, 2, 4, 75, 141, 105, 74, 28, 21, 28, 66, 99, 109, 103, 107, 78, 32, 50, 143, 101, 116, 132, 91, 132, 51, 193, 209, 135, 89, 153, 141, 91, 127, 99, 1, 67, 130, 150, 129, 131, 126, 5, 37, 15, 35, 19, 133, 113,
+#> 113, 97, 121, 192, 180, 180, 157, 183, 104, 116, 135, 61, 19, 8, 0, 5, 15, 21, 7, 0, 11, 10, 2, 4, 1, 1, 78, 177, 190, 154, 180, 257, 216, 246, 194, 224, 178, 201, 167, 12, 205, 133, 2, 29, 37, 40, 95, 139, 172, 204, 128, 205, 200, 104, 184, 192, 173, 172, 186, 199, 156, 138, 105, 13, 48, 24, 95, 91, 66, 127, 83, 140, 153, 75, 73, 98, 108, 77, 53, 59, 14, 155, 171, 117, 163, 218, 235, 250, 163, 227, 203, 167, 205, 188, 229, 32, 118, 13, 3, 27, 7, 5, 2, 18, 3, 28, 1, 26, 3, 89, 78, 88, 33, 61, 52,
+#> 49, 70, 6, 40, 62, 37, 7, 5, 1, 68, 160, 180, 138, 20, 0, 150, 8, 74, 13, 117, 145, 133, 151, 132, 127, 126, 169, 208, 106, 164, 177, 52, 138, 188, 3, 17, 12, 12, 10, 2, 13, 13, 14, 14, 12, 20, 14, 20, 22, 34, 131, 103, 154, 80, 170, 119, 130, 132, 4, 24, 3, 60, 88, 70, 76, 62, 112, 77, 90, 42, 43, 1, 54, 164, 78, 13, 178, 145, 162, 196, 147, 58, 185, 168, 183, 182, 173, 41, 146, 102, 3, 110, 177, 172, 144, 143, 158, 174, 128, 75, 140, 161, 207, 188, 178, 186, 26, 72, 143, 73, 7, 2, 2, 19, 7, 17,
+#> 21, 23, 29, 25, 31, 29, 28, 36, 17, 7, 0, 4, 49, 69, 68, 91, 89, 68, 87, 115, 157, 108, 122, 82, 73, 26, 44, 7, 72, 156, 163, 143, 169, 137, 133, 156, 143, 137, 131, 167, 137, 183, 166, 156, 117, 0, 10, 7, 2, 6, 4, 14, 14, 14, 16, 23, 17, 22, 10, 161, 116, 96, 161, 201, 89, 70, 100, 158, 150, 139, 151, 126, 132, 124, 123, 119, 133, 32, 3, 16, 18, 17, 34, 27, 22, 30, 37, 24, 18, 18, 42, 26, 3, 15, 14, 11, 3, 1, 0, 1, 0, 9, 50, 0, 91, 127, 119, 141, 141, 103, 138, 144, 166, 132, 150, 142, 124, 35,
+#> 64, 3, 96, 59, 143, 149, 132, 151, 204, 180, 177, 174, 136, 202, 0, 5, 7, 65, 150, 108, 126, 104, 157, 177, 158, 196, 99, 26, 1, 0, 1, 3, 9, 24, 4, 32, 22, 19, 14, 10, 3, 20, 16, 14, 5, 3, 59, 177, 8, 179, 211, 185, 187, 188, 216, 227, 216, 179, 202, 199, 207, 128, 93, 25, 98, 0, 15, 25, 21, 23, 33, 15, 11, 1, 1, 13, 13, 21, 20, 25, 18, 10, 7, 11, 9, 17, 2, 1, 4, 8, 11, 8, 18, 27, 22, 16, 16, 11, 13, 13, 0, 129, 72, 85, 127, 98, 141, 153, 151, 150, 131, 137, 13, 28, 36, 4, 35, 45, 77, 67, 86, 111,
+#> 50, 83, 43, 22, 9, 143, 152, 204, 165, 185, 200, 187, 132, 114, 8, 11, 6, 4, 1, 10, 11, 16, 25, 15, 8, 8, 9, 10, 8, 10, 2, 4, 4, 0, 9, 18, 27, 30, 8, 14, 26, 49, 23, 4, 24, 4, 22, 13, 8, 12, 43, 123, 211, 168, 223, 198, 166, 171, 208, 164, 176, 187, 161, 142, 177, 168, 104, 83, 7, 6, 12, 0, 2, 31, 157, 181, 194, 172, 185, 181, 151, 60, 119, 169, 55, 54, 49, 41, 112, 79, 132, 154, 204, 215, 149, 74, 30, 15, 4, 5, 12, 16, 13, 8, 26, 18, 25, 12, 13, 11, 1, 0, 3, 1, 11, 13, 26, 80, 105, 158, 136, 98,
+#> 72, 182, 184, 118, 125, 104, 86, 38, 4, 2, 11, 14, 7, 14, 16, 27, 2, 25, 39, 31, 31, 42, 26, 13, 7, 2, 3, 1, 11, 18, 17, 24, 15, 15, 6, 8, 12, 8, 10, 14, 6, 9, 9, 1, 9, 15, 18, 7, 25, 13, 21, 17, 18, 22, 19, 20, 18, 15, 11, 6, 9, 9, 12, 5, 0, 24, 20, 34, 26, 32, 15, 36, 2, 23, 21, 5, 118, 143, 143, 106, 144, 171, 174, 190, 173, 174, 41, 167, 115, 77, 4, 3, 41, 77, 128, 155, 135, 135, 95, 43, 43, 35, 5, 16, 6, 12, 0, 41, 127, 156, 79, 172, 168, 237, 162, 211, 197, 225, 184, 201, 183, 156, 153, 8,
+#> 13, 11, 23, 29, 52, 33, 29, 30, 21, 28, 37, 36, 22, 10, 0, 0, 8, 3, 8, 0, 2, 17, 23, 25, 21, 16, 25, 28, 13, 5, 7, 14, 11, 2, 1, 23, 182, 167, 195, 188, 204, 187, 180, 190, 182, 102, 146, 137, 143, 2, 31, 14, 121, 154, 173, 194, 156, 159, 145, 169, 161, 138, 124, 176, 175, 95, 79, 0, 33, 1, 0, 3, 32, 27, 67, 65, 127, 144, 44, 4, 88, 144, 47, 26, 11, 76, 75, 39, 16, 39, 15, 30, 0, 0, 0, 9, 4, 17, 30, 18, 21, 13, 26, 27, 18, 8, 15, 18, 4, 1, 5, 2, 1, 0, 5, 20, 21, 13, 13, 3, 2, 7, 0, 2, 0, 0, 20, 7,
+#> 16, 14, 10, 15, 17, 10, 12, 9, 5, 5, 1, 2, 1, 17, 74, 112, 131, 150, 164, 187, 174, 127, 167, 118, 132, 161, 166, 171, 144, 21, 75, 32, 24, 5, 0, 14, 119, 120, 114, 131, 96, 53, 57, 19, 36, 92, 6, 84, 6, 118, 166, 183, 222, 213, 165, 166, 151, 133, 106, 110, 13, 1, 25, 0, 31, 24, 19, 29, 10, 13, 17, 7, 2, 1, 12, 1, 5, 1, 4, 13, 20, 18, 9, 16, 16, 20, 18, 15, 15, 9, 11, 10, 8, 5, 3, 0, 90, 180, 117, 126, 149, 145, 162, 146, 172, 50, 30, 140, 154, 107, 11, 5, 161, 208, 160, 189, 182, 196, 192, 192,
+#> 182, 183, 169, 190, 137, 57, 2, 14, 62, 106, 115, 78, 132, 117, 6, 172, 107, 110, 135, 131, 142, 130, 126, 82, 85, 17, 45, 12, 93, 113, 150, 132, 138, 154, 65, 138, 155, 131, 131, 70, 84, 92, 36, 48, 9, 0, 2, 2, 56, 70, 99, 92, 142, 142, 122, 110, 132, 90, 46, 50, 25, 6, 32, 12, 12, 139, 101, 146, 137, 170, 174, 160, 152, 138, 140, 131, 34, 30, 183, 253, 199, 159, 163, 212, 211, 200, 216, 200, 192, 140, 186, 117, 142, 93, 3, 25, 3, 27, 3, 13, 116, 180, 199, 201, 201, 194, 173, 159, 129, 51, 194,
+#> 171, 163, 187, 172, 180, 43, 9, 1, 17, 18, 22, 28, 23, 20, 38, 5, 19, 26, 20, 18, 11, 12, 14, 18, 18, 20, 16, 0, 0, 0, 10, 165, 220, 197, 88, 142, 183, 228, 202, 130, 83, 189, 42, 56, 185, 110, 69, 177, 189, 141, 160, 126, 5, 171, 76, 122, 49, 3, 49, 194, 167, 227, 180, 174, 187, 176, 148, 133, 92, 137, 158, 103, 162, 26, 9, 77, 77, 65, 55, 7, 16, 41, 103, 101, 51, 21, 13, 50, 0, 8, 16, 24, 14, 32, 33, 16, 7, 20, 1, 9, 0, 0, 0, 139, 99, 137, 92, 178, 139, 15, 14, 88, 171, 181, 143, 164, 216, 175,
+#> 52, 2, 0, 13, 159, 134, 142, 141, 146, 170, 140, 89, 15, 121, 150, 126, 104, 6, 103, 122, 84, 188, 177, 241, 204, 65, 129, 189, 214, 221, 194, 131, 91, 155, 12, 4, 0, 9, 98, 139, 159, 125, 181, 197, 2, 136, 8, 8, 8, 10, 15, 22, 22, 23, 18, 9, 6, 7, 11, 13, 8, 9, 8, 5, 13, 14, 21, 14, 14, 11, 16, 17, 2, 0, 2, 113, 43, 170, 175, 163, 198, 208, 103, 143, 96, 45, 2, 6, 1, 7, 23, 10, 15, 0, 21, 17, 23, 11, 6, 5, 9, 5, 0, 7, 17, 9, 9, 7, 3, 1, 11, 6, 129, 179, 218, 210, 166, 220, 211, 208, 198, 210, 176,
+#> 205, 200, 170, 4, 162, 176, 134, 193, 173, 129, 153, 154, 117, 130, 154, 109, 32, 11, 13, 0, 5, 5, 22, 20, 16, 10, 24, 16, 22, 28, 17, 9, 1, 4, 13, 0, 3, 5, 10, 14, 6, 4, 1, 0, 16, 14, 21, 25, 7, 21, 1, 10, 10, 7, 0, 0, 8, 1, 0, 1, 13, 27, 13, 15, 21, 20, 13, 8, 7, 14, 5, 12, 8, 10, 4, 5, 1, 19, 17, 12, 20, 14, 13, 13, 23, 16, 11, 16, 6, 5, 2, 3, 9, 5, 4, 180, 237, 223, 200, 217, 180, 215, 191, 217, 176, 218, 219, 175, 151, 69, 6, 82, 86, 70, 39, 1, 0, 1, 39, 156, 65, 189, 185, 226, 254, 213, 225,
+#> 153, 213, 203, 71, 66, 78, 110, 85, 122, 21, 106, 128, 115, 105, 68, 94, 81, 81, 64, 24, 0, 1, 9, 223, 221, 234, 94, 214, 188, 138, 173, 166, 133, 177, 194, 108, 43, 21, 42, 1, 75, 4, 5, 5, 9, 6, 3, 15, 18, 4, 13, 19, 27, 19, 4, 7, 17, 3, 1, 14, 16, 6, 6, 5, 3, 14, 12, 4, 8, 16, 9, 11, 3, 11, 11, 9, 2, 4, 23, 108, 61, 114, 175, 175, 150, 157, 87, 172, 157, 20, 67, 15, 13, 14, 5, 17, 28, 15, 15, 22, 14, 19, 16, 4, 2, 14, 0, 1, 20, 102, 164, 172, 231, 175, 231, 91, 161, 167, 111, 94, 28, 82, 105, 66,
+#> 13, 149, 133, 86, 209, 36, 139, 40, 5, 12, 6, 3, 127, 161, 193, 215, 201, 119, 184, 204, 214, 201, 227, 209, 174, 132, 161, 96, 12, 35, 9, 140, 168, 138, 105, 128, 150, 123, 135, 67, 131, 131, 97, 148, 144, 122, 116, 116, 26, 27, 0, 14, 203, 181, 231, 194, 202, 183, 179, 190, 125, 80, 84, 14, 15, 26, 30, 26, 8, 16, 13, 2, 8, 4, 10, 12, 11, 8, 19, 19, 11, 14, 13, 7, 0, 1, 22, 35, 37, 31, 38, 22, 52, 36, 12, 27, 2, 11, 1, 0, 2, 7, 153, 170, 192, 188, 147, 9, 116, 4, 39, 75, 111, 171, 38, 12, 22, 0,
+#> 18, 22, 26, 17, 14, 10, 11, 0, 10, 1, 0, 11, 3, 23, 47, 23, 41, 38, 43, 43, 35, 23, 21, 26, 22, 5, 5, 12, 13, 20, 26, 20, 23, 26, 25, 21, 9, 8, 15, 8, 11, 4, 4, 2, 3, 5, 113, 254, 202, 172, 219, 40, 70, 56, 6, 10, 42, 131, 183, 188, 150, 213, 204, 180, 185, 198, 162, 197, 168, 153, 146, 27, 42, 1, 60, 198, 181, 209, 198, 180, 187, 162, 232, 182, 159, 15, 81, 33, 2, 22, 5, 55, 139, 203, 187, 177, 186, 143, 164, 83, 175, 172, 160, 156, 161, 24, 24, 46, 3, 1, 4, 4, 10, 8, 12, 12, 10, 8, 9, 5, 2, 5,
+#> 98, 80, 25, 146, 147, 189, 148, 145, 133, 104, 13, 74, 14, 0, 13, 1, 10, 7, 18, 18, 23, 12, 13, 16, 9, 6, 6, 5, 5, 17, 15, 12, 21, 19, 30, 23, 13, 16, 10, 11, 7, 13, 14, 0, 18, 13, 18, 16, 21, 23, 18, 13, 9, 13, 9, 15, 9, 11, 18, 18, 15, 22, 21, 19, 19, 22, 8, 7, 5, 3, 12, 11, 5, 4, 1, 1, 91, 219, 250, 200, 226, 223, 131, 127, 32, 152, 132, 113, 9, 81, 77, 9, 1, 2, 1, 3, 11, 18, 9, 13, 10, 10, 21, 13, 11, 0, 9, 5, 0, 0, 5, 19, 30, 22, 20, 17, 21, 23, 10, 18, 9, 6, 10, 5, 0, 32, 206, 173, 138, 227,
+#> 211, 189, 173, 191, 163, 156, 7, 146, 193, 53, 77, 10, 2, 3, 10, 16, 14, 21, 21, 2, 3, 1, 1, 14, 9, 0, 1, 25, 19, 29, 30, 27, 15, 5, 5, 4, 0, 1, 0, 71, 184, 152, 160, 189, 159, 187, 141, 152, 158, 126, 80, 123, 2, 113, 77, 91, 0, 3, 145, 124, 156, 131, 152, 127, 125, 153, 176, 142, 145, 92, 99, 79, 85, 35, 6, 178, 179, 155, 159, 172, 159, 135, 130, 161, 133, 145, 161, 55, 13, 16, 114, 136, 135, 175, 159, 155, 157, 158, 148, 150, 51, 104, 110, 25, 10, 35, 4, 19, 19, 23, 16, 13, 23, 16, 15, 22, 24,
+#> 17, 19, 13, 11, 7, 3, 3, 8, 11, 16, 12, 26, 25, 23, 7, 14, 12, 4, 6, 14, 0, 0, 172, 199, 185, 165, 183, 174, 154, 31, 58, 125, 6, 85, 0, 13, 0, 130, 97, 111, 112, 120, 95, 103, 68, 63, 104, 35, 45, 84, 74, 98, 76, 53, 46, 33, 37, 182, 198, 224, 223, 237, 190, 201, 127, 48, 171, 166, 47, 91, 165, 62, 28, 24, 46, 4, 2, 5, 2, 9, 19, 13, 14, 12, 12, 19, 8, 1, 0, 158, 180, 186, 192, 190, 151, 174, 182, 178, 118, 137, 186, 41, 30, 4, 110, 0, 200, 118, 147, 144, 129, 173, 162, 100, 76, 11, 33, 34, 23, 2,
+#> 1, 15, 18, 15, 4, 0, 36, 11, 22, 10, 4, 0, 0, 9, 19, 17, 16, 14, 21, 11, 15, 10, 10, 11, 2, 8, 10, 16, 2, 3, 5, 63, 188, 161, 182, 128, 32, 2, 30, 84, 73, 23, 46, 140, 179, 182, 145, 180, 164, 190, 191, 175, 160, 164, 122, 155, 150, 162, 89, 115, 139, 5, 0, 1, 2, 110, 153, 192, 201, 205, 180, 153, 151, 150, 117, 1, 7, 21, 28, 21, 16, 18, 16, 14, 15, 10, 13, 1, 0, 135, 201, 203, 16, 200, 175, 156, 195, 18, 84, 145, 100, 0, 19, 58, 129, 195, 202, 214, 188, 171, 198, 183, 200, 180, 166, 182, 169, 149,
+#> 60, 42, 0, 6, 189, 194, 115, 138, 216, 145, 193, 201, 153, 114, 11, 7, 154, 147, 166, 67, 208, 186, 153, 101, 81, 67, 141, 156, 51, 4, 0, 124, 77, 189, 131, 161, 177, 103, 79, 86, 72, 24, 84, 144, 179, 127, 172, 114, 162, 46, 12, 206, 215, 194, 176, 179, 193, 186, 146, 168, 190, 94, 158, 109, 2, 18, 32, 20, 23, 2, 10, 25, 6, 3, 6, 12, 2, 6, 12, 2, 9, 13, 5, 15, 14, 6, 20, 16, 10, 1, 3, 7, 3, 0, 2, 112, 202, 208, 181, 134, 166, 132, 156, 147, 150, 168, 36, 46, 70, 49, 85, 70, 26, 8, 69, 134, 197,
+#> 137, 161, 204, 182, 89, 162, 197, 186, 142, 192, 21, 180, 154, 156, 148, 30, 42, 21, 116, 133, 167, 173, 195, 191, 191, 186, 166, 154, 108, 193, 92, 65, 155, 57, 153, 151, 162, 144, 182, 160, 156, 63, 59, 4, 8, 22, 17, 19, 15, 16, 12, 18, 9, 13, 14, 14, 1, 9, 12, 1, 13, 9, 13, 13, 10, 3, 5, 1, 4, 8, 1, 8, 13, 9, 12, 5, 0, 1, 1, 2, 0, 4, 10, 21, 2, 0, 8, 1, 176, 200, 207, 144, 186, 94, 32, 146, 125, 7, 121, 166, 83, 14, 22, 16, 3, 0, 3, 0, 136, 204, 179, 197, 182, 150, 165, 127, 177, 162, 102, 6,
+#> 76, 86, 36, 26, 14, 140, 125, 212, 199, 130, 170, 139, 26, 6, 42, 25, 13, 24, 22, 13, 18, 6, 0, 0, 1, 2, 1, 0, 80, 192, 181, 179, 196, 213, 147, 148, 58, 1, 17, 10, 14, 38, 35, 3, 37, 36, 38, 29, 28, 37, 37, 26, 24, 35, 11, 27, 20, 10, 3, 5, 36, 68, 82, 63, 6, 36, 22, 23, 133, 146, 99, 74, 60, 104, 111, 69, 13, 25, 43, 76, 31, 1, 14, 14, 172, 126, 78, 199, 158, 116, 50, 113, 87, 47, 123, 116, 34, 0, 0, 0, 17, 1, 22, 23, 19, 3, 31, 18, 4, 23, 9, 0, 12, 11, 5, 2, 10, 14, 2, 10, 4, 7, 3, 2, 0, 1, 5,
+#> 15, 4, 6, 10, 11, 13, 18, 5, 11, 4, 2, 0, 5, 27, 209, 209, 191, 162, 156, 143, 177, 160, 143, 75, 9, 45, 54, 125, 99, 127, 114, 129, 123, 167, 129, 120, 105, 102, 90, 95, 113, 69, 31, 0, 32, 37, 11, 84, 137, 163, 157, 112, 114, 10, 24, 12, 15, 20, 13, 10, 11, 11, 7, 1, 14, 4, 4, 8, 1, 159, 139, 150, 166, 152, 134, 40, 55, 72, 37, 117, 161, 173, 162, 173, 135, 79, 153, 154, 136, 87, 155, 168, 174, 165, 146, 176, 184, 137, 152, 160, 116, 170, 148, 3, 9, 17, 21, 18, 18, 4, 16, 18, 9, 17, 10, 10, 7,
+#> 6, 9, 1, 0, 0, 12, 1, 2, 19, 21, 16, 9, 1, 7, 18, 18, 9, 14, 12, 12, 1, 0, 2, 3, 185, 193, 185, 186, 176, 181, 188, 194, 106, 169, 4, 37, 133, 114, 138, 163, 135, 69, 98, 8, 14, 50, 19, 78, 24, 29, 38, 9, 10, 39, 24, 20, 24, 24, 30, 14, 7, 12, 4, 0, 20, 13, 8, 4, 12, 13, 40, 6, 0, 11, 12, 9, 10, 7, 0, 43, 139, 135, 146, 55, 133, 141, 150, 138, 139, 154, 82, 9, 5, 13, 0, 67, 67, 48, 142, 133, 176, 115, 122, 57, 18, 2, 45, 203, 94, 54, 97, 113, 133, 35, 32, 149, 140, 174, 175, 155, 142, 143, 149, 148,
+#> 88, 9, 7, 79, 0, 56, 137, 49, 92, 122, 143, 123, 15, 40, 47, 144, 91, 25, 38, 40, 2, 133, 143, 151, 159, 139, 49, 148, 36, 66, 29, 16, 16, 0, 0, 65, 146, 135, 173, 188, 167, 136, 65, 119, 129, 70, 13, 41, 24, 13, 1, 9, 79, 157, 140, 130, 129, 112, 100, 58, 146, 115, 55, 39, 18, 167, 131, 139, 128, 130, 125, 124, 59, 3, 2, 12, 5, 15, 25, 15, 23, 29, 6, 3, 4, 14, 4, 6, 1, 19, 13, 7, 13, 125, 170, 164, 181, 190, 139, 170, 218, 13, 117, 44, 13, 33, 100, 157, 167, 161, 128, 164, 147, 151, 132, 87, 42,
+#> 145, 115, 192, 127, 168, 155, 20, 58, 1, 12, 2, 15, 6, 0, 6, 3, 0, 7, 6, 14, 26, 14, 17, 2, 2, 3, 15, 8, 6, 1, 1, 0, 0, 1, 16, 15, 18, 1, 3, 0, 12, 3, 5, 5, 3, 156, 71, 66, 184, 149, 117, 120, 30, 60, 16, 38, 6, 0, 0, 2, 11, 17, 21, 8, 9, 10, 1, 10, 10, 1, 0, 1, 109, 193, 158, 132, 188, 183, 162, 176, 191, 161, 115, 153, 143, 31, 86, 1, 62, 24, 53, 42, 3, 17, 59, 100, 131, 88, 125, 120, 134, 114, 155, 54, 138, 119, 110, 52, 57, 49, 8, 197, 169, 98, 182, 107, 120, 153, 0, 159, 191, 138, 156, 179,
+#> 111, 169, 96, 139, 166, 57, 9, 1, 18, 9, 10, 12, 2, 0, 1, 7, 8, 9, 15, 10, 15, 4, 7, 8, 1, 13, 10, 15, 18, 18, 30, 7, 17, 5, 7, 0, 11, 20, 1, 5, 15, 5, 1, 0, 4, 14, 2, 9, 11, 15, 25, 0, 4, 14, 12, 19, 47, 203, 152, 187, 169, 141, 92, 3, 77, 1, 169, 148, 164, 165, 138, 157, 171, 177, 185, 113, 75, 24, 53, 104, 1, 14, 2, 16, 13, 13, 19, 17, 19, 6, 2, 14, 0, 6, 0, 11, 8, 3, 2, 1, 0, 10, 8, 0, 0, 0, 121, 138, 134, 117, 135, 119, 116, 147, 143, 140, 92, 46, 0, 54, 106, 89, 81, 89, 109, 95, 126, 24, 54,
+#> 63, 23, 16, 205, 208, 207, 159, 185, 153, 150, 10, 45, 90, 3, 40, 1, 115, 138, 101, 186, 153, 150, 155, 161, 157, 160, 39, 97, 8, 166, 77, 141, 131, 82, 85, 12, 116, 71, 1, 12, 4, 9, 16, 20, 36, 25, 20, 11, 15, 2, 12, 14, 6, 3, 0, 4, 4, 10, 3, 0, 0, 19, 11, 15, 14, 10, 12, 1, 200, 98, 106, 104, 89, 26, 1, 0, 20, 147, 220, 197, 228, 183, 230, 207, 192, 205, 194, 200, 195, 179, 184, 176, 159, 87, 91, 107, 143, 86, 1, 1, 11, 14, 16, 13, 30, 25, 20, 9, 5, 6, 1, 6, 49, 123, 143, 126, 7, 75, 157, 77, 86,
+#> 31, 111, 9, 107, 82, 30, 49, 3, 31, 18, 21, 126, 123, 1, 1, 103, 141, 118, 144, 82, 116, 0, 4, 60, 205, 195, 122, 146, 130, 41, 0, 71, 19, 0, 0, 8, 9, 8, 12, 29, 28, 13, 19, 19, 18, 13, 9, 10, 4, 2, 0, 43, 161, 144, 166, 183, 160, 157, 128, 176, 153, 135, 162, 137, 62, 54, 40, 71, 134, 177, 148, 63, 1, 3, 128, 166, 130, 0, 154, 73, 39, 99, 0, 4, 0, 1, 22, 10, 9, 9, 2, 7, 7, 1, 33, 147, 167, 173, 141, 158, 163, 152, 158, 145, 150, 167, 172, 116, 3, 90, 2, 2, 19, 7, 179, 140, 63, 47, 171, 165, 114,
+#> 163, 191, 182, 184, 162, 129, 51, 21, 39, 168, 121, 158, 168, 161, 75, 10, 138, 181, 168, 122, 138, 105, 174, 156, 147, 95, 34, 64, 21, 0, 28, 34, 124, 0, 17, 12, 1, 63, 69, 71, 60, 28, 32, 24, 27, 9, 1, 0, 1, 5, 2, 19, 21, 11, 7, 6, 4, 6, 8, 3, 0, 3, 15, 9, 4, 0, 1, 6, 9, 12, 9, 4, 0, 0, 19, 43, 11, 59, 159, 28, 21, 69, 141, 162, 1, 145, 110, 104, 8, 162, 125, 94, 64, 15, 54, 99, 130, 154, 197, 177, 150, 144, 93, 106, 70, 64, 15, 6, 50, 0, 3, 93, 150, 150, 165, 156, 159, 47, 2, 22, 126, 159, 66,
+#> 155, 171, 146, 156, 69, 47, 158, 153, 146, 67, 24, 61, 39, 31, 0, 8, 11, 7, 11, 20, 12, 21, 14, 12, 6, 7, 11, 15, 12, 7, 11, 13, 7, 8, 13, 1, 0, 1, 0, 155, 170, 195, 224, 176, 191, 190, 101, 96, 5, 4, 0, 1, 0, 0, 11, 13, 2, 10, 1, 8, 7, 1, 1, 4, 16, 17, 18, 5, 9, 1, 0, 24, 133, 46, 69, 197, 1, 87, 28, 39, 3, 103, 151, 143, 51, 149, 92, 71, 3, 159, 168, 148, 207, 159, 135, 170, 17, 100, 160, 143, 205, 173, 162, 125, 65, 104, 20, 1, 1, 138, 154, 142, 26, 188, 112, 179, 218, 191, 88, 45, 141, 24, 66,
+#> 134, 90, 25, 92, 0, 45, 98, 68, 82, 89, 64, 15, 17, 0, 58, 185, 149, 143, 154, 191, 106, 151, 165, 199, 135, 70, 73, 0, 5, 7, 7, 14, 15, 8, 16, 12, 5, 0, 13, 4, 1, 13, 6, 3, 0, 125, 72, 6, 143, 132, 141, 79, 144, 158, 127, 19, 8, 4, 95, 95, 63, 88, 59, 36, 57, 71, 77, 40, 59, 21, 16, 4, 169, 149, 171, 184, 185, 142, 171, 165, 145, 167, 164, 140, 86, 21, 4, 2, 28, 37, 25, 20, 21, 11, 4, 19, 17, 6, 0, 0, 85, 136, 144, 154, 135, 155, 172, 138, 176, 152, 142, 171, 156, 147, 74, 33, 126, 165, 178, 169,
+#> 145, 185, 186, 193, 189, 143, 1, 27, 195, 195, 166, 147, 145, 109, 129, 134, 109, 157, 75, 8, 82, 143, 115, 192, 161, 146, 149, 179, 147, 155, 121, 115, 134, 99, 107, 52, 43, 2, 0, 10, 7, 8, 14, 13, 16, 17, 15, 14, 13, 5, 8, 66, 127, 96, 90, 149, 129, 142, 158, 181, 118, 41, 78, 139, 79, 31, 26, 9, 33, 23, 0, 10, 1, 0, 6, 13, 11, 4, 13, 24, 5, 1, 0, 0, 124, 177, 147, 170, 149, 164, 126, 117, 40, 159, 78, 0, 4, 2, 12, 15, 5, 4, 11, 3, 0, 4, 4, 2, 0, 1, 7, 16, 15, 18, 23, 22, 18, 23, 21, 17, 22, 13,
+#> 36, 24, 14, 21, 18, 16, 11, 4, 3, 103, 144, 171, 146, 153, 70, 132, 15, 106, 95, 18, 7, 175, 170, 203, 170, 185, 157, 159, 120, 81, 98, 134, 146, 138, 147, 146, 176, 114, 71, 30, 37, 10, 31, 42, 89, 112, 102, 76, 68, 87, 5, 125, 109, 83, 36, 25, 1, 0, 16, 18, 34, 29, 37, 21, 28, 26, 21, 19, 18, 3, 3, 1, 10, 19, 13, 17, 15, 13, 9, 9, 6, 0, 29, 27, 40, 19, 65, 69, 101, 106, 125, 95, 22, 37, 105, 61, 16, 4, 4, 9, 9, 11, 10, 8, 4, 1, 1, 0, 3, 0, 2, 7, 10, 0, 0, 3, 175, 146, 164, 196, 177, 194, 189, 134,
+#> 52, 118, 169, 137, 19, 126, 42, 48, 5, 9, 7, 10, 7, 7, 2, 0, 0, 12, 109, 75, 97, 120, 173, 43, 97, 125, 50, 44, 20, 103, 74, 1, 13, 29, 19, 25, 8, 21, 3, 6, 7, 96, 97, 185, 172, 143, 70, 45, 118, 19, 81, 65, 127, 145, 12, 68, 125, 83, 1, 34, 0, 6, 0, 12, 120, 170, 159, 156, 129, 157, 176, 158, 146, 173, 123, 114, 39, 52, 32, 5, 8, 6, 119, 132, 119, 156, 139, 146, 158, 151, 127, 111, 35, 8, 72, 125, 123, 164, 126, 162, 82, 142, 85, 80, 22, 24, 23, 15, 42, 26, 17, 21, 5, 32, 5, 6, 144, 88, 20, 6, 77,
+#> 119, 138, 139, 172, 162, 93, 131, 145, 125, 108, 22, 10, 4, 1, 8, 6, 12, 13, 4, 0, 11, 5, 3, 0, 0, 0, 158, 157, 121, 150, 117, 169, 200, 148, 147, 112, 60, 37, 12, 123, 150, 90, 17, 2, 65, 22, 47, 42, 6, 180, 86, 35, 128, 150, 90, 127, 96, 57, 10, 47, 42, 4, 48, 7, 0, 1, 12, 11, 19, 14, 7, 5, 3, 18, 6, 2, 1, 0, 10, 0, 0, 3, 4, 3, 1, 11, 0, 0, 1, 0, 0, 95, 129, 108, 177, 189, 197, 105, 165, 161, 164, 151, 121, 119, 27, 2, 20, 39, 161, 199, 168, 162, 198, 199, 166, 158, 139, 102, 114, 57, 69, 44, 86,
+#> 35, 16, 13, 16, 16, 9, 8, 8, 4, 0, 19, 7, 1, 2, 116, 174, 172, 150, 164, 168, 178, 104, 90, 114, 40, 11, 19, 0, 159, 160, 141, 0, 5, 132, 153, 164, 132, 143, 135, 157, 143, 135, 120, 70, 14, 12, 123, 146, 154, 102, 152, 136, 156, 126, 109, 87, 127, 30, 195, 185, 171, 195, 208, 180, 190, 176, 189, 187, 171, 177, 159, 128, 144, 114, 139, 113, 52, 9, 44, 5, 8, 17, 5, 13, 8, 0, 5, 9, 0, 1, 2, 1, 2, 0, 7, 8, 1, 5, 5, 8, 14, 10, 4, 3, 3, 7, 11, 18, 19, 9, 1, 6, 2, 10, 8, 5, 1, 7, 0, 2, 1, 0, 0, 0, 10,
+#> 5, 34, 138, 104, 36, 148, 138, 153, 104, 150, 55, 45, 98, 59, 1, 0, 10, 18, 9, 3, 2, 0, 0, 5, 4, 0, 1, 3, 0, 0, 91, 171, 136, 163, 158, 188, 173, 158, 154, 145, 163, 121, 54, 141, 92, 96, 108, 103, 11, 5, 12, 15, 14, 22, 15, 27, 20, 13, 20, 17, 12, 3, 10, 16, 9, 6, 5, 2, 1, 10, 151, 131, 115, 64, 1, 9, 15, 97, 151, 21, 121, 68, 35, 127, 63, 78, 92, 0, 1, 1, 7, 159, 152, 171, 201, 140, 120, 111, 26, 209, 201, 190, 196, 173, 179, 198, 146, 125, 148, 121, 92, 26, 14, 1, 47, 168, 171, 134, 178, 154,
+#> 145, 156, 138, 107, 159, 148, 76, 104, 51, 157, 170, 167, 111, 190, 177, 160, 188, 193, 192, 148, 99, 48, 122, 78, 112, 0, 58, 36, 43, 0, 6, 1, 1, 0, 6, 15, 25, 9, 12, 14, 5, 0, 1, 0, 0, 0, 44, 38, 56, 57, 53, 39, 9, 10, 3, 1, 1, 6, 0, 3, 0, 0, 0, 0, 193, 175, 161, 152, 69, 164, 140, 152, 59, 90, 26, 18, 1, 104, 164, 165, 157, 159, 180, 187, 192, 156, 34, 88, 30, 32, 53, 64, 3, 60, 165, 179, 160, 189, 146, 115, 124, 95, 8, 11, 41, 0, 3, 2, 11, 16, 17, 14, 11, 19, 16, 8, 4, 0, 0, 2, 0, NA, 0, 0, 0,
+#> 0, 0, 11, 17, 11, 15, 9, 16, 9, 16, 14, 9, 0, 8, 7, 0, 2, 1, 10, 16, 1, 1, 5, 3, 0, 0, 150, 170, 15, 141, 161, 132, 108, 156, 164, 149, 115, 134, 1, 0, 2, 63, 113, 189, 192, 178, 201, 198, 192, 196, 187, 191, 175, 152, 166, 140, 117, 11, 128, 175, 138, 144, 150, 167, 137, 182, 152, 175, 142, 144, 117, 137, 113, 25, 78, 11, 7, 139, 200, 194, 170, 170, 167, 153, 190, 121, 172, 154, 112, 138, 141, 94, 124, 130, 119, 87, 79, 146, 7, 20, 10, 14, 17, 6, 15, 15, 8, 17, 10, 13, 8, 15, 0, 2, 11, 163, 176,
+#> 160, 169, 193, 179, 162, 142, 164, 98, 156, 162, 139, 158, 136, 143, 56, 16, 23, 22, 6, 19, 14, 15, 12, 6, 8, 6, 5, 2, 3, 0, 3, 0, 0, 142, 148, 148, 157, 166, 170, 140, 150, 154, 127, 182, 127, 164, 168, 173, 114, 112, 135, 166, 197, 149, 168, 138, 176, 208, 125, 174, 172, 182, 149, 113, 166, 144, 128, 86, 142, 107, 10, 28, 15, 140, 182, 144, 175, 174, 168, 194, 178, 176, 185, 139, 132, 47, 39, 3, 60, 7, 131, 189, 200, 198, 196, 223, 172, 197, 191, 201, 187, 181, 168, 184, 174, 164, 154, 162, 119,
+#> 118, 91, 109, 62, 0, 5, 9, 20, 16, 17, 11, 11, 12, 16, 17, 17, 13, 12, 8, 12, 4, 3, 0, 0, 4, 9, 7, 20, 16, 13, 24, 21, 16, 21, 9, 1, 3, 12, 0, 2, 6, 1, 0, 7, 17, 185, 185, 169, 161, 157, 175, 169, 142, 87, 32, 15, 7, 8, 74, 111, 78, 90, 96, 77, 111, 132, 90, 115, 134, 106, 95, 59, 17, 3, 167, 6, 160, 174, 182, 149, 172, 176, 168, 172, 184, 151, 19, 72, 7, 1, 0, 42, 132, 130, 147, 126, 126, 122, 90, 65, 94, 111, 115, 80, 4, 80, 128, 47, 128, 148, 143, 155, 170, 53, 143, 95, 74, 1, 15, 10, 8, 13, 16,
+#> 15, 13, 4, 1, 3, 3, 3, 0, 3, 6, 20, 14, 17, 13, 13, 23, 13, 12, 22, 19, 17, 5, 2, 2, 9, 3, 81, 76, 90, 118, 121, 79, 155, 138, 140, 172, 91, 105, 17, 39, 49, 0, 5, 11, 11, 8, 5, 12, 4, 4, 2, 0, 3, 4, 118, 190, 164, 121, 122, 62, 172, 167, 151, 177, 146, 55, 10, 10, 51, 87, 103, 149, 164, 122, 136, 153, 110, 132, 70, 141, 48, 2, 43, 159, 135, 146, 176, 159, 99, 78, 137, 156, 115, 16, 24, 23, 80, 30, 26, 0, 33, 138, 103, 145, 166, 185, 151, 117, 76, 83, 9, 9, 2, 62, 149, 156, 119, 147, 148, 155, 131,
+#> 161, 134, 163, 167, 127, 52, 84, 49, 12, 60, 56, 104, 112, 104, 74, 97, 116, 133, 158, 6, 104, 52, 45, 30, 25, 3, 28, 18, 12, 22, 2, 21, 11, 12, 17, 8, 13, 2, 0, 0, 12, 50, 2, 163, 147, 160, 158, 182, 153, 157, 148, 131, 146, 32, 15, 20, 123, 160, 176, 59, 100, 0, 188, 192, 169, 182, 191, 183, 161, 6, 14, 137, 183, 149, 147, 173, 69, 25, 0, 159, 23, 39, 2, 116, 172, 125, 166, 172, 158, 84, 114, 13, 120, 152, 109, 50, 42, 10, 7, 20, 0, 4, 3, 7, 14, 10, 16, 16, 10, 12, 6, 11, 11, 9, 5, 3, 0, 1, 0,
+#> 7, 6, 2, 2, 1, 0, 3, 4, 0, 0, 0, 1, 2, 15, 29, 19, 15, 33, 23, 10, 18, 20, 22, 25, 17, 15, 23, 10, 15, 22, 15, 6, 7, 3, 39, 121, 120, 177, 122, 80, 132, 10, 57, 105, 12, 13, 116, 130, 153, 129, 112, 127, 59, 41, 21, 2, 7, 149, 126, 136, 138, 143, 141, 102, 37, 128, 116, 43, 15, 68, 62, 89, 67, 158, 80, 149, 148, 126, 153, 157, 143, 91, 56, 102, 87, 104, 5, 41, 134, 80, 88, 23, 0, 1, 14, 10, 10, 9, 11, 16, 5, 2, 0, 0, 3, 11, 12, 16, 10, 12, 12, 16, 17, 5, 14, 5, 19, 20, 16, 3, 2, 10, 28, 110, 89,
+#> 175, 192, 192, 148, 194, 166, 167, 164, 154, 140, 168, 160, 139, 141, 159, 97, 46, 7, 2, 1, 20, 38, 14, 126, 139, 146, 145, 110, 117, 93, 18, 58, 145, 140, 125, 151, 122, 89, 62, 87, 35, 1, 10, 36, 84, 41, 99, 118, 141, 159, 151, 84, 144, 37, 81, 107, 79, 130, 7, 156, 157, 169, 199, 200, 191, 157, 159, 77, 92, 12, 109, 139, 142, 158, 175, 163, 186, 164, 199, 201, 186, 149, 152, 3, 12, 0, 0, 135, 132, 34, 109, 150, 138, 13, 116, 20, 51, 48, 27, 30, 4, 7, 3, 120, 79, 146, 114, 98, 149, 137, 133, 164,
+#> 175, 160, 153, 8, 70, 58, 73, 92, 143, 139, 127, 84, 166, 150, 129, 48, 80, 71, 153, 84, 27, 0, 6, 14, 9, 10, 10, 10, 2, 0, 7, 0, 4, 3, 3, 5, 1, 5, 6, 6, 3, 6, 5, 3, 1, 1, 1, 7, 19, 2, 1, 6, 4, 2, 2, 2, 0, 2, 1, 0, 0, 0, 4, 1, 2, 0, NA, 0, 9, 8, 10, 1, 2, 0, 0, 4, 1, 78, 45, 141, 116, 173, 209, 167, 181, 164, 153, 0, 16, 19, 9, 15, 10, 17, 25, 4, 8, 0, 0, 2, 1, 4, 10, 104, 92, 61, 99, 97, 111, 119, 102, 123, 91, 82, 95, 20, 121, 169, 114, 150, 128, 179, 201, 168, 192, 211, 194, 202, 209, 146, 175,
+#> 145, 178, 118, 26, 205, 187, 208, 181, 204, 166, 204, 178, 187, 135, 126, 164, 149, 133, 121, 112, 71, 63, 152, 173, 208, 159, 173, 186, 162, 186, 174, 129, 42, 141, 169, 17, 11, 9, 8, 5, 0, 0, 1, 0, 5, 13, 147, 184, 175, 201, 203, 179, 176, 185, 188, 205, 179, 191, 166, 113, 127, 74, 2, 25, 101, 193, 123, 133, 123, 124, 168, 118, 108, 135, 96, 128, 114, 95, 34, 4, 89, 116, 148, 151, 138, 169, 164, 162, 161, 170, 127, 42, 46, 23, 20, 15, 55, 110, 91, 127, 129, 4, 63, 58, 71, 112, 99, 98, 118, 74,
+#> 1, 42, 22, 21, 8, 0, 0, 2, 0, 3, 3, 7, 8, 15, 8, 3, 2, 1, 3, 13, 2, 5, 0, 0, 7, 2, 0, 3, 8, 4, 4, 0, 2, 6, 2, 5, 4, 2, 5, 1, 1, 2, 0, 0, 70, 29, 21, 127, 164, 160, 162, 152, 153, 105, 46, 9, 4, 1, 6, 1, 14, 3, 4, 6, 15, 20, 7, 7, 7, 3, 1, 0, 5, 9, 15, 15, 13, 16, 22, 16, 19, 39, 20, 12, 14, 3, 0, 2, 15, 18, 8, 14, 23, 23, 17, 12, 18, 15, 15, 13, NA, 0, 0, NA, 14, 10, 7, NA, 0, NA, 5, 3, 0, 0, 5, 172, 133, 111, 121, 91, 121, 144, 116, 70, 68, 76, 81, 61, 73, 9, 2, 178, 140, 131, 168, 125, 98, 99,
+#> 74, 26, 1, 1, 0, 0, 17, 20, 12, 9, 8, 3, 10, 16, 9, 7, 0, 0, 97, 128, 230, 181, 163, 15, 98, 174, 122, 19, 123, 11, 60, 58, 71, 21, 7, 169, 181, 130, 58, 5, 2, 6, 0, 5, 9, 11, 11, 8, 11, 4, 3, 1, 0, 3, 2, 6, 5, 0, 1, 1, 0, 0, 1, 4, 3, 5, 2, 0, 3, 7, 3, 1, 2, 0, 0, 0, 0, 0, 0, 1, 0, 2, 0, 6, 6, 7, 5, 6, 7, 7, 20, 9, 155, 191, 183, 164, 154, 165, 189, 162, 154, 186, 129, 120, 160, 155, 146, 146, 165, 145, 140, 100, 83, 126, 101, 9, 6, 143, 137, 162, 171, 182, 135, 116, 79, 49, 20, 37, 27, 115, 128,
+#> 119, 99, 54, 43, 55, 115, 101, 74, 89, 61, 26, 0, 1, 110, 53, 94, 108, 188, 200, 211, 191, 167, 172, 186, 173, 7, 2, 76, 90, 60, 90, 21, 69, 12, 74, 116, 68, 4, 0, 0, 1, 0, 21, 25, 13, 19, 21, 15, 12, 20, 26, 6, 170, 139, 209, 205, 176, 210, 218, 205, 192, 198, 230, 185, 210, 215, 204, 198, 208, 185, 140, 172, 121, 35, 72, 107, 52, 33, 157, 154, 131, 149, 126, 93, 124, 57, 70, 131, 56, 4, 30, 4, 7, 21, 20, 14, 17, 28, 14, 20, 15, 5, 14, 10, 13, NA, 0, 19, 18, 75, 121, 181, 178, 179, 162, 169, 145,
+#> 97, 131, 126, 61, 71, 24, 3, 5, 13, 20, 18, 15, 25, 20, 8, 16, 29, 33, 15, 20, 12, 17, 5, 0, 4, 12, 7, 7, 2, 3, 5, 1, 3, 0, 0, 108, 156, 152, 86, 103, 101, 43, 11, 26, 57, 84, 117, 12, 15, 4, 15, 24, 7, 1, 87, 164, 137, 187, 185, 173, 175, 176, 142, 166, 148, 148, 140, 143, 83, 17, 61, 98, 55, 47, 79, 39, 5, 93, 5, 6, 4, 3, 217, 185, 191, 161, 136, 197, 204, 164, 9, 166, 131, 123, 26, 7, 201, 187, 166, 142, 137, 126, 128, 162, 156, 79, 139, 97, 80, 41, 68, 118, 114, 160, 90, 160, 168, 126, 24, 19,
+#> 8, 4, 16, 22, 9, 6, 132, 122, 156, 134, 133, 156, 108, 160, 147, 62, 153, 143, 127, 100, 60, 74, 62, 6, 51, 170, 140, 167, 154, 171, 150, 151, 167, 81, 79, 29, 42, 60, 50, 31, 16, 7, 4, 145, 144, 47, 138, 102, 132, 125, 103, 145, 112, 124, 108, 4, 1, 113, 62, 147, 193, 152, 172, 132, 115, 174, 203, 230, 157, 149, 149, 89, 95, 9, 4, 14, 6, 1, 6, 1, 6, 13, 0, 1, 0, 0, 4, 73, 156, 101, 115, 146, 142, 128, 95, 143, 98, 89, 132, 105, 64, 33, 61, 173, 133, 150, 160, 145, 97, 106, 162, 145, 146, 123, 42,
+#> 25, 24, 120, 107, 134, 90, 137, 57, 7, 22, 5, 20, 136, 149, 129, 69, 65, 79, 95, 34, 42, 87, 79, 137, 121, 56, 44, 11, 1, 129, 144, 149, 85, 100, 27, 22, 5, 0, 50, 10, 3, 5, 11, 16, 15, 8, 13, 6, 10, 15, 15, 5, 4, 2, 5, 2, 0, 1, 2, 9, 13, 11, 8, 13, 18, 16, 16, 16, NA, 0, 2, 61, 2, 2, 130, 177, 130, 81, 71, 121, 147, 154, 49, 114, 6, 3, 23, 34, 6, 129, 5, 9, 74, 115, 145, 153, 125, 103, 160, 125, 151, 145, 156, 153, 136, 110, 51, 115, 119, 53, 17, 17, 0, 3, 1, 6, 5, 3, 4, 2, 0, 1, 0, 0, 1, 1, 2,
+#> 0, NA, 1, 4, 2, 4, 1, 2, 0, 3, 2, 0, 1, 0, 2, 0, 3, 0, 1, 0, 105, 125, 137, 125, 123, 14, 79, 92, 33, 23, 3, 4, 2, 3, 172, 124, 80, 153, 182, 121, 96, 48, 11, 11, 44, 126, 173, 158, 116, 70, 104, 79, 86, 32, 0, 16, 154, 136, 146, 129, 136, 141, 134, 156, 126, 28, 24, 16, 0, 1, 97, 130, 123, 117, 141, 97, 137, 162, 156, 107, 117, 98, 91, 129, 63, 10, 4, 109, 131, 63, 82, 75, 63, 28, 51, 21, 4, 4, 12, 15, 15, 14, 8, 15, 20, 20, 10, 6, 1, 46, 68, 85, 120, 177, 159, 105, 165, 218, 157, 210, 134, 156,
+#> 133, 2, 90, 10, 66, 0, 0, 0, 2, 1, 1, 1, 0, 1, 0, 0, 0, 0, 0, 1, 1, 3, 13, 9, 13, 1, 3, 1, 3, 0, 1, 0, 0, 1, 0, 2, 73, 68, 174, 176, 185, 186, 164, 146, 177, 158, 144, 137, 158, 158, 132, 161, 77, 51, 61, 33, 60, 51, 1, 114, 141, 54, 146, 182, 183, 206, 184, 195, 202, 200, 193, 193, 194, 163, 150, 133, 66, 123, 8, 5, 14, 11, 4, 4, 9, 10, 8, 9, 1, 11, 5, 6, 0, 0, 6, 12, 7, 16, 15, 3, 8, 1, 3, 14, 10, 6, 9, 1, 4, 0, 147, 171, 60, 139, 142, 141, 154, 185, 170, 176, 166, 157, 96, 35, 39, 14, 0, 85, 84,
+#> 162, 89, 178, 128, 135, 111, 140, 144, 96, 74, 43, 22, 21, 1, 0, 55, 129, 120, 102, 112, 131, 196, 146, 119, 0, 1, 124, 144, 125, 133, 61, 7, 78, 83, 17, 37, 3, 0, 150, 126, 152, 70, 177, 170, 203, 218, 192, 200, 239, 188, 130, 179, 111, 167, 160, 97, 124, 11, 15, 11, 17, 18, 13, 15, 7, 17, 7, 12, 5, 9, 12, 6, 11, 6, 10, 0, 0, NA, NA, 4, 2, 16, 117, 134, 113, 149, 139, 110, 134, 47, 132, 60, 36, 88, 7, 23, 8, 15, 43, 54, 36, 33, 1, 61, 49, 155, 107, 148, 146, 133, 156, 82, 148, 106, 145, 102, 93,
+#> 23, 11, 0, 7, 0, 14, 16, 15, 14, 28, 20, 10, 1, NA, NA, NA, 0, 0, NA, NA, 10, 13, 1, 1, 1, 2, 7, 5, 9, 12, 8, 8, 11, 15, 6, NA, NA, NA, 7, 0, 0, 1, 5, 4, 17, 10, 18, 17, 2, 6, 2, 0, 4, 139, 148, 168, 176, 175, 126, 128, 160, 144, 63, 37, 150, 132, 64, 100, 7, 99, 3, 28, 68, 70, 151, 139, 143, 117, 102, 147, 87, 42, 55, 51, 40, 147, 188, 167, 189, 158, 170, 181, 128, 95, 44, 6, 14, 155, 156, 177, 134, 145, 141, 174, 150, 109, 136, 102, 128, 90, 55, 103, 79, 42, 12, 6, 12, 96, 108, 116, 65, 80, 80,
+#> 9, 61, 4, 41, 10, 4, 2, 1, 4, 5, 11, 12, 14, 0, NA, 0, 0, 0, 5, NA, 1, 1, 1, 1, NA, 0, 52, 27, 115, 47, 62, 16, 53, 16, 147, 10, 115, 11, 32, 14, 13, 140, 138, 110, 146, 133, 113, 130, 77, 130, 71, 169, 105, 1, 150, 42, 32, 25, 180, 74, 0, 2, 7, 6, 15, 6, 11, 8, 14, 12, 12, NA, NA, 4, 2, 62, 146, 134, 157, 181, 168, 159, 158, 151, 155, 146, 120, 28, 32, 110, 22, 0, 0, 0, 0, 0, 0, 1, 2, 0, 2, 5, 17, NA, 0, 0, NA, NA, NA, 1, 57, 81, 40, 29, 13, 47, 53, 25, 0, 0, 0, 0, 8, 13, 11, 12, 10, 11, 11, NA,
+#> NA, NA, NA, NA, 8, 129, 126, 122, 143, 149, 144, 83, 151, 114, 1, 50, 15, 17, 1, 3, 32, 98, 152, 100, 133, 53, 106, 111, 100, 141, 83, 74, 33, 61, 23, 12, 25, 32, 165, 174, 183, 167, 128, 185, 139, 191, 150, 78, 19, 28, 0, 20, 95, 113, 154, 140, 111, 129, 120, 140, 62, 124, 117, 24, 0, 0, 139, 163, 125, 179, 128, 158, 39, 92, 112, 148, 137, 92, 44, 80, 43, 26, 160, 104, 126, 116, 147, 126, 135, 64, 146, 77, 23, 82, 5, 21, 138, 151, 101, 157, 132, 158, 146, 150, 138, 150, 140, 138, 154, 79, 146, 77,
+#> 117, 116, 101, 74, 1, 75, 124, 127, 95, 159, 152, 139, 125, 87, 121, 96, 51, 0, 4, 11, 12, 17, 16, 17, 23, 16, 25, 14, 20, 26, 25, 21, 19, 9, 22, 19, 16, 5, NA, 7, 2, NA, NA, NA, 1, 62, 57, 11, 66, 75, 183, 186, 185, 231, 201, 192, 34, 127, 147, 3, 16, 2, 11, 136, 101, 151, 164, 140, 161, 92, 88, 130, 12, 8, 1, 1, 3, 2, 3, 2, 1, 0, 2, 1, 0, 0, 0, 0, 0, 1, 2, 1, 1, 2, NA, 0, NA, 0, 0, 11, 67, 155, 129, 184, 171, 119, 150, 31, 51, 114, 65, 26, 15, 22, 12, 11, 0, 11, 2, 9, 13, 8, 6, 16, 24, 17, 11,
+#> NA, NA, NA, 0, 13, 98, 140, 121, 47, 21, 94, 98, 107, 131, 116, 34, 85, 61, 9, 35, 17, 1, 0, 20, 138, 134, 110, 126, 40, 19, 83, 63, 12, 12, 2, 1, 12, 103, 120, 117, 127, 69, 128, 66, 118, 118, 64, 8, 54, 89, 140, 145, 118, 131, 146, 137, 100, 121, 46, 75, 117, 140, 148, 100, 129, 149, 59, 7, 22, 137, 113, 143, 156, 135, 190, 186, 183, 183, 110, 0, 15, 14, 7, 17, 10, 15, 8, 0, 4, 4, 8, 12, 12, 15, 13, 16, 13, 13, 7, NA, 2, NA, 0, 3, 4, 10, 10, 11, 14, 4, 0, NA, NA, NA, 13, 16, 67, 64, 194, 186, 171,
+#> 94, 95, 129, 71, 2, 15, 4, 0, 3, 12, 2, 0, 0, NA, NA, 0, 6, 10, 5, 7, NA, NA, 4, 4, 13, 14, 176, 167, 158, 175, 157, 116, 165, 120, 145, 170, 99, 100, 136, 93, 16, 78, 161, 200, 178, 162, 182, 145, 143, 100, 156, 25, 126, 148, 47, 35, 28, 86, 171, 126, 180, 133, 177, 146, 161, 155, 181, 198, 178, 171, 180, 102, 42, 132, 14, 4, 22, 137, 88, 98, 137, 138, 90, 92, 75, 16, 84, 48, 22, 20, 49, 114, 136, 156, 22, 97, 171, 188, 172, 171, 155, 170, 110, 144, 125, 100, 40, 38, 0, 7, 129, 146, 109, 105, 92,
+#> 39, 45, 84, 19, 17, 99, 158, 168, 137, 144, 89, 100, 5, 124, 127, 152, 147, 103, 32, 39, 9, 12, 146, 146, 175, 171, 187, 166, 157, 138, 147, 140, 49, 72, 80, 31, 32, 4, 19, 47, 109, 156, 70, 84, 45, 45, 32, 36, 29, 20, 1, 5, 7, 1, 13, 17, 20, 22, NA, NA, NA, NA, NA, NA, NA, 0, NA, NA, NA, NA, 0, 25, 116, 162, 169, 153, 154, 168, 147, 149, 152, 137, 148, 137, 116, 54, 16, 28, 26, 139, 158, 170, 155, 166, 171, 158, 113, 157, 58, 17, 12, 0, 0, 2, 0, 3, 0, 1, NA, NA, NA, NA, 0, NA, 0, 7, 2, 6, 17, 13,
+#> 15, 5, 3, 1, 0, 4, 1, 3, 0, 0, 0, 6, 7, 163, 121, 136, 5, 126, 147, 149, 161, 167, 150, 163, 151, 150, 104, 109, 112, 74, 134, 93, 89, 6, 32, 49, 51, 132, 102, 127, 104, 102, 90, 122, 70, 30, 32, 11, 3, 4, 3, 10, 16, 13, 11, 14, 14, 10, 17, NA, NA, 0, NA, NA, NA, 8, 6, NA, NA, 12, NA, NA, 0, 7, 118, 122, 101, 83, 69, 24, 0, 0, 15, 134, 125, 56, 87, 124, 169, 162, 87, 138, 89, 127, 141, 83, 129, 101, 116, 70, 110, 129, 111, 43, 10, 1, 22, 117, 100, 82, 133, 60, 36, 153, 164, 120, 105, 122, 111, 11,
+#> 18, 0, 110, 161, 179, 168, 164, 144, 171, 148, 54, 123, 154, 83, 142, 77, 105, 53, 33, 18, 137, 162, 145, 94, 184, 178, 155, 175, 192, 130, 144, 102, 123, 133, 87, 48, 2, 3, 10, 9, 8, 7, 17, 3, NA, NA, NA, NA, NA, NA, 8, 32, 23, 108, 137, 181, 118, 174, 130, 135, 64, 127, 80, 88, 22, 41, 0, 21, 12, 37, 7, 135, 75, 12, 4, 15, 2, 141, 151, 135, 125, 132, 112, 125, 3, 126, 78, 103, 69, 136, 67, 7, 6, 21, 53, 44, 79, 37, 9, 2, 1, 2, 0, 3, 4, NA, 0, NA, 0, 0, NA, 0, 0, NA, 2, NA, 1, 0, 0, 3, 1, 0, 6,
+#> 6, 1, 1, 2, 3, 3, 0, NA, NA, 1, 0, 69, 156, 153, 149, 177, 142, 168, 143, 150, 150, 153, 135, 137, 140, 50, 56, 1, 53, 21, 46, 20, 9, 128, 146, 153, 136, 138, 44, 122, 157, 135, 107, 132, 113, 93, 116, 84, 2, 17, 26, 86, 95, 89, 116, 87, 4, 50, 19, 35, 82, 25, 29, 12, 6, 7, 24, 22, 0, 132, 142, 145, 145, 102, 101, 50, 27, 61, 65, 2, 0, 0, 2, 3, 6, 0, 0, NA, NA, NA, 0, NA, NA, NA, NA, 4, 120, 63, 94, 113, 164, 27, 162, 205, 107, 147, 104, 93, 19, 18, 162, 161, 119, 164, 157, 135, 192, 159, 108, 173,
+#> 115, 143, 70, 96, 11, 28, 0, 0, 32, 25, 150, 142, 100, 161, 138, 125, 129, 127, 124, 72, 45, 9, 7, 25, 152, 171, 132, 146, 126, 170, 121, 129, 132, 145, 154, 117, 50, 13, 0, 9, 7, 10, 15, 21, 9, 16, 0, 0, 0, NA, NA, NA, 2, NA, 10, 6, 14, 63, 106, 167, 137, 138, 24, 57, 117, 133, 142, 147, 92, 119, 145, 93, 125, 122, 128, 91, 57, 0, 3, 3, 10, 12, 16, 4, 0, 48, 72, 48, 118, 163, 149, 52, 152, 176, 179, 170, 123, 61, 136, 111, 70, 44, 54, 2, 7, 0, 1, 3, 3, 8, 8, 1, 1, 0, 1, NA, 0, 0, 0, 0, 1, 25, 51,
+#> 79, 106, 200, 210, 200, 192, 202, 204, 200, 122, 176, 114, 175, 184, 142, 16, 10, 115, 110, 127, 69, 47, 133, 73, 116, 12, 87, 61, 6, 9, 18, 19, 19, 18, 36, 23, 1, 0, NA, 0, NA, NA, NA, 2, 9, 18, 70, 68, 133, 129, 149, 131, 67, 85, 37, 29, 32, 18, 2, 12, 11, 16, 10, 15, 23, 17, 12, 4, NA, 2, 69, 67, 79, 94, 167, 139, 162, 155, 170, 166, 162, 129, 164, 123, 130, 141, 81, 89, 39, 66, 15, 158, 78, 66, 96, 29, 42, 2, 42, 12, 147, 167, 132, 143, 157, 147, 89, 73, 81, 79, 108, 15, 49, 134, 157, 155, 160,
+#> 124, 110, 24, 179, 102, 160, 134, 94, 81, 19, 173, 124, 91, 95, 32, 127, 163, 171, 60, 31, 67, 7, 72, 160, 140, 153, 149, 129, 137, 157, 112, 144, 136, 146, 152, 160, 153, 97, 30, 4, 9, 8, 12, 19, 14, 8, NA, NA, 3, 7, 108, 168, 146, 168, 154, 134, 132, 130, 111, 147, 69, 2, 10, 0, 0, NA, NA, 9, 4, 0, 0, 0, 0, 4, 2, 0, 0, 0, 5, 4, 7, 6, 0, 0, 0, 0, 1, 2, 1, 5, 0, 0, NA, NA, 27, 142, 182, 174, 161, 138, 102, 65, 137, 95, 181, 153, 102, 41, 100, 106, 91, 11, 5, 6, 4, 18, 7, 19, 13, 3, 6, NA, 0, 0, 0,
+#> NA, NA, NA, NA, 3, NA, 18, 175, 159, 129, 161, 177, 125, 56, 141, 119, 140, 118, 114, 100, 76, 20, 85, 47, 28, 100, 157, 159, 154, 153, 133, 162, 141, 56, 0, 122, 187, 153, 109, 7, 175, 167, 172, 154, 142, 85, 117, 89, 68, 52, 3, 7, 6, 8, 13, 11, 7, 0, 12, 8, 0, 1, 4, 7, 8, 6, 4, 7, 1, 1, 5, NA, 1, NA, NA, NA, 1, 17, 50, 129, 156, 141, 129, 139, 155, 148, 150, 162, 132, 79, 85, 94, 123, 90, 115, 77, 37, 16, 18, 174, 164, 206, 213, 201, 148, 128, 177, 191, 184, 159, 200, 112, 128, 49, 0, 88, 97, 120,
+#> 149, 153, 152, 142, 103, 147, 150, 105, 183, 140, 55, 107, 63, 8, 10, 11, 6, 5, 15, 15, 3, 2, 4, 2, 30, 158, 174, 82, 179, 162, 171, 143, 114, 84, 100, 170, 128, 98, 1, 132, 149, 149, 176, 191, 198, 176, 143, 175, 170, 159, 209, 130, 204, 184, 29, 101, 20, 47, 40, 62, 172, 168, 215, 194, 193, 153, 62, 66, 154, 173, 198, 174, 149, 97, 146, 176, 108, 12, 0, 0, NA, NA, NA, 5, NA, NA, 0, NA, NA, NA, 4, 0, 0, 0, 0, NA, 0, NA, NA, 0, 0, 0, 0, 0, 0, 4, 3, 0, 0, NA, NA, 0, 0, 1, 2, 6, 86, 28, 29, 11, 73,
+#> 139, 172, 197, 170, 133, 144, 122, 136, 145, 149, 119, 11, 53, 31, 54, 130, 17, 135, 153, 142, 123, 127, 124, 115, 67, 102, 87, 36, 35, 18, 62, 8, 4, 91, 94, 102, 132, 144, 136, 138, 94, 118, 76, 91, 90, 91, 28, 13, 26, 29, 15, 63, 130, 113, 121, 66, 123, 134, 123, 122, 178, 112, 186, 162, 137, 165, 164, 148, 111, 73, 137, 161, 57, 149, 145, 110, 88, 152, 54, 86, 85, 47, 52, 26, 0, 5, 10, 10, 8, 12, 9, 17, 10, 10, 15, 6, 7, 14, 8, 0, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 15, 10, 11, 15,
+#> 13, 19, 13, 10, 18, 11, 7, 11, 6, 11, 5, 7, 11, NA, NA, NA, NA, NA, NA, NA, 2, NA, NA, 0, 0, NA, NA, NA, NA, NA, 1, 1, 0, 2, 0, 0, 0, 1, 0, 1, 2, NA, 0, 0, NA, 0, NA, NA, NA, NA, 0, 0, 0, 0, 0, 0, 0, 7, 3, 6, 3, 2, 2, 6, 3, 2, 2, 0, 5, 129, 195, 215, 176, 150, 212, 175, 109, 166, 144, 107, 184, 128, 124, 180, 129, 179, 129, 169, 149, 10, 41, 89, 27, 79, 167, 147, 175, 191, 170, 113, 145, 106, 189, 183, 96, 83, 70, 10, NA, NA, 0, 0, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 0, 0,
+#> NA, 9, 8, 71, 34, 45, 133, 175, 184, 184, 148, 82, 74, 210, 114, 16, 88, 94, 0, 6, 153, 131, 145, 160, 24, 158, 135, 71, 156, 156, 96, 46, 4, 132, 11, 10, 1, 9, 14, 136, 118, 71, 98, 125, 123, 114, 110, 48, 121, 120, 91, 114, 98, 94, 104, 111, 28, 33, 57, 141, 189, 186, 177, 120, 160, 123, 134, 140, 109, 120, 90, 60, 114, 48, 14, 62, 13, 29, 24, 31, 45, 76, 102, 116, 127, 124, 148, 91, 156, 143, 130, 140, 154, 138, 126, 107, 52, 17, 24, 104, 74, 122, 114, 123, 36, 54, 30, 52, 96, 119, 125, 103, 41,
+#> 23, 17, 65, 91, 154, 189, 133, 152, 27, 113, 66, 151, 73, 145, 120, 15, 2, 0, 7, 14, 143, 174, 147, 129, 93, 155, 137, 152, 170, 128, 171, 138, 71, 92, 58, 173, 174, 179, 186, 111, 174, 178, 180, 173, 151, 171, 171, 147, 184, 150, 144, 174, 110, 141, 59, 88, 35, 2, 20, 148, 154, 176, 178, 119, 183, 189, 132, 135, 141, 178, 179, 105, 164, 153, 150, 126, 70, 58, 16, 10, 115, 151, 139, 155, 151, 83, 155, 117, 162, 137, 136, 137, 93, 155, 26, 75, 141, 72, 4, 128, 83, 15, 148, 146, 80, 158, 165, 151,
+#> 27, 17, 20, 4, 0, 5, 3, 8, 6, 13, 0, NA, NA, NA, NA, NA, NA, 6, 11, 10, 5, 6, 7, 6, 4, 4, NA, NA, NA, NA, NA, 109, 146, 157, 194, 155, 174, 179, 126, 7, 34, 0, 77, 43, 1, 3, 69, 155, 180, 192, 163, 193, 159, 164, 148, 127, 150, 82, 145, 185, 110, 144, 32, 49, 21, 6, 9, 19, 16, 19, 18, 10, 13, 13, 2, NA, 1, 7, 10, 11, 9, 2, 8, 10, 4, 0, 62, 200, 181, 211, 161, 96, 139, 121, 127, 154, 126, 113, 90, 129, 125, 50, 11, 29, 136, 159, 138, 118, 92, 99, 128, 54, 27, 32, 99, 3, 0, 0, 0, 0, 0, 0, NA, NA, 0,
+#> 0, NA, NA, NA, 0, 11, 21, 115, 73, 21, 76, 48, 125, 125, 113, 92, 104, 75, 32, 15, 10, 47, 108, 163, 138, 210, 191, 115, 173, 98, 62, 171, 183, 171, 170, 96, 50, 26, 9, 147, 141, 162, 103, 142, 163, 154, 139, 44, 109, 137, 4, 59, 78, 47, 23, 10, 12, 85, 149, 165, 151, 98, 16, 35, 97, 65, 8, 0, 1, 0, 7, 8, 20, 12, 14, 18, 10, 20, 17, 18, 19, 27, 24, 12, 4, 17, 12, NA, NA, NA, 0, NA, NA, 8, 138, 121, 111, 88, 160, 206, 161, 170, 157, 160, 111, 128, 112, 131, 126, 111, 97, 73, 86, 153, 124, 83, 130,
+#> 117, 31, 129, 141, 53, 115, 63, 105, 155, 182, 172, 166, 156, 186, 70, 163, 145, 162, 176, 173, 175, 58, 23, 102, 51, 53, 34, 19, 12, 86, 149, 161, 174, 147, 154, 179, 103, 210, 178, 186, 129, 163, 198, 190, 195, 145, 131, 147, 117, 4, 23, 104, 181, 144, 124, 103, 154, 132, 65, 124, 55, 120, 120, 110, 89, 120, 54, NA, NA, NA, NA, NA, 0, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 0, NA, 0, 3, 1, 3, 1, 0, 1, 0, 0, 0, 0, 0, 13, 4, 24, 114, 95, 127, 193, 127, 182, 219, 133, 205, 203, 166, 185, 140,
+#> 62, 119, 169, 111, 150, 170, 140, 157, 200, 161, 106, 159, 171, 174, 54, 74, 158, 148, 10, 68, 15, 13, 106, 146, 109, 129, 152, 94, 57, 136, 11, 74, 71, 24, 3, 5, 135, 139, 141, 144, 112, 155, 100, 149, 87, 32, 102, 101, 45, 63, 41, 8, 39, 132, 136, 139, 169, 181, 184, 154, 114, 151, 169, 193, 174, 148, 158, 180, 114, 13, 149, 169, 148, 74, 22, 4, 0, 81, 116, 133, 148, 147, 141, 151, 186, 85, 90, 160, 162, 129, 110, 139, 81, 14, 58, 7, 79, 109, 17, 35, 114, 133, 120, 54, 161, 143, 159, 109, 92, 10,
+#> NA, NA, NA, NA, 0, 0, NA, NA, NA, 0, NA, NA, 0, NA, NA, 112, 165, 102, 99, 156, 12, 1, 6, 2, 179, 166, 81, 130, 132, 101, 166, 169, 130, 63, 125, 97, 85, 35, 20, 0, 0, 21, 4, 2, NA, NA, 14, NA, 10, 11, 12, 12, 10, 0, 3, NA, NA, 3, 15, 7, 89, 104, 95, 81, 117, 138, 155, 104, 39, 86, 116, 98, 53, 41, 31, 52, 73, 139, 169, 141, 176, 151, 176, 147, 168, 177, 101, 141, 140, 78, 57, 104, 29, 135, 160, 168, 135, 44, 2, 125, 124, 23, 50, 100, 113, 85, 32, 106, 62, 78, 116, 113, 7, 6, 44, 40, 105, 153, 71,
+#> 78, 109, 49, 147, 141, 118, 1, 33, 118, 121, 196, 168, 120, 158, 98, 38, 92, 17, 13, 84, 9, 6, 1, 6, 13, 4, 3, 1, 0, 3, 5, 7, 9, 10, 22, 9, 8, 8, 11, 17, NA, NA, NA, NA, NA, 3, 4, 1, 4, 4, 4, 2, 4, 1, 2, 1, 4, 0, 1, 2, 0, 0, 1, 1, 0, 4, 0, 7, 8, 3, NA, NA, NA, 0, NA, 10, 99, 157, 98, 129, 107, 143, 122, 83, 51, 36, 34, 1, 11, 43, 185, 230, 133, 194, 159, 163, 168, 170, 170, 155, 97, 89, 70, 107, 57, 5, 0, NA, 0, 0, NA, NA, NA, 0, NA, 0, 8, 120, 127, 168, 101, 126, 161, 174, 156, 159, 205, 145, 109,
+#> 170, 93, 28, 132, 78, 60, 45, 34, 62, 8, 54, 126, 135, 113, 72, 47, 57, 107, 89, 13, 1, 11, 136, 68, 148, 136, 143, 145, 94, 163, 146, 175, 156, 125, 123, 110, 28, 62, 61, 62, 152, 124, 140, 100, 121, 134, 106, 148, 144, 182, 155, 162, 130, 157, 153, 157, 100, 31, 64, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 0, 1, 0, 131, 29, 12, 1, 0, 0, 1, 0, NA, NA, NA, NA, 0, NA, NA, NA, 9, 63, 136, 158, 85, 138, 163, 137, 150, 84, 114, 91, 103, 126, 87, 19, 45, 4, 34, 36, 10, 61, 32, 68, 95, 87, 118, 142, 145,
+#> 180, 97, 147, 115, 121, 99, 98, 27, 22, 118, 138, 145, 146, 168, 27, 110, 148, 173, 112, 145, 168, 122, 5, 59, 77, 39, 31, 7, 24, 11, 12, 15, 8, 23, 5, 15, 13, 4, 11, 13, 17, 1, 7, 4, 3, 2, 20, 63, 112, 144, 57, 68, 54, 25, 61, 56, 69, 71, 72, 42, 62, 17, 1, 0, 0, NA, NA, NA, NA, NA, 4, 8, 12, 4, 2, NA, 2, 3, 8, 3, 0, 0, 0, 3, 0, 0, 0, 3, 0, 10, 124, 151, 160, 139, 136, 150, 137, 140, 90, 141, 160, 121, 116, 70, 23, 0, 16, 16, 17, 15, 21, 24, 13, 8, 12, 21, NA, NA, 3, 8, 9, 3, 1, 15, 0, 42, 78, 97,
+#> 78, 52, 34, 15, 0, 96, 179, 135, 143, 150, 147, 172, 160, 104, 169, 58, 90, 159, 126, 112, 104, 35, 77, 122, 112, 21, 79, 128, 138, 21, 77, 86, 40, 15, 0, 9, 9, 3, 0, 9, 6, 11, 10, 11, 4, 8, 3, 8, 1, NA, NA, NA, NA, NA, NA, NA, NA, 0, NA, 0, NA, 0, 1, 1, NA, NA, NA, 133, 188, 157, 134, 145, 92, 179, 111, 168, 160, 155, 185, 136, 1, 130, 2, 87, 51, 69, 175, 115, 125, 125, 171, 102, 112, 16, 100, 52, NA, NA, 0, 0, NA, NA, 0, NA, 0, NA, 0, 0, NA, NA, NA, NA, NA, NA, 5, 15, 59, 104, 175, 174, 162, 156,
+#> 15, 184, 64, 40, 177, 140, 116, 32, 29, 34, 84, 103, 77, 99, 44, 67, 48, 18, 48, 68, 45, 25, 27, NA, NA, NA, 8, 12, 13, NA, NA, NA, NA, NA, 17, 24, 120, 106, 160, 91, 168, 178, 176, 185, 163, 167, 134, 131, 81, 57, 137, 10, 6, 5, 158, 211, 195, 181, 177, 157, 152, 166, 150, 210, 160, 165, 140, 144, 178, 166, 163, 113, 79, 114, 33, 180, 175, 138, 136, 210, 171, 175, 205, 160, 198, 134, 28, 6, 8, 10, 151, 63, 185, 161, 180, 169, 119, 7, 55, 2, 0, 42, 103, 135, 146, 97, 122, 91, 173, 104, 147, 104,
+#> 131, 106, 2, 82, 95, 168, 87, 132, 153, 127, 120, 16, 11, 1, 20, 10, 19, 3, 24, 2, 9, 5, 4, 1, 3, 9, 15, 9, 6, NA, 7, 0, 4, 2, 0, 0, NA, NA, NA, NA, NA, NA, NA, NA, NA, 29, 12, 43, 45, 111, 136, 150, 94, 139, 82, 30, 17, 104, 26, 33, 0, 0, 0, 0, NA, NA, NA, 0, 0, 0, NA, NA, NA, NA, NA, 0, 0, 5, 101, 57, 182, 158, 126, 115, 25, 146, 42, 27, 152, 142, 97, 39, 5, 57, 12, 4, 11, 13, 11, 10, 8, 12, 13, 8, 11, 12, 7, 2, NA, NA, NA, 0, 0, 0, NA, 0, NA, NA, NA, NA, NA, NA, NA, 3, 0, 4, 8, 2, 26, 38, 37,
+#> 5, 61, 114, 88, 95, 54, 88, 80, 76, 92, 68, 25, 42, 27, 25, 34, 1, NA, 0, NA, NA, 0, 0, 4, 6, 0, 10, 15, 5, 13, 9, NA, NA, NA, 1, 13, 9, 10, 12, 1, 172, 165, 200, 186, 178, 154, 163, 176, 188, 170, 186, 141, 53, 135, 118, 9, 63, 147, 163, 156, 136, 147, 82, 133, 110, 129, 107, 99, 55, 33, 69, 34, 11, 4, 125, 172, 166, 216, 127, 177, 164, 47, 31, 168, 155, 141, 143, 44, 57, 95, 90, 68, 68, 2, 24, 13, 175, 163, 100, 179, 154, 62, 26, 59, 145, 144, 65, 0, 0, 1, 1, 2, 0, 0, NA, 0, 2, NA, NA, 7, 132,
+#> 100, 87, 63, 19, 44, 58, 51, 10, 68, 9, 108, 131, 109, 123, 151, 146, 107, 150, 134, 37, 14, 22, 24, 53, 3, 73, 16, 118, 210, 203, 240, 207, 200, 214, 205, 187, 181, 133, 169, 125, 149, 156, 103, 122, 88, 89, 88, 115, 170, 166, 151, 149, 167, 113, 111, 107, 68, 25, 182, 163, 173, 163, 174, 44, 129, 184, 153, 112, 5, 31, 63, 115, 166, 156, 127, 139, 114, 128, 60, 85, 84, 40, 6, 80, 78, 92, 42, 81, 133, 173, 178, 161, 185, 109, 157, 189, 187, 163, 133, 88, 16, 19, 68, 26, 137, 177, 6, 63, 69, 14, 68,
+#> 118, 141, 136, 68, 66, 42, 75, 107, 85, 132, 136, 93, 102, 94, 117, 75, 26, 2, 5, 8, 1, 1, 6, 9, 9, 5, 4, 1, 6, NA, 3, NA, 0, 1, 95, 179, 183, 192, 184, 194, 175, 116, 148, 131, 163, 162, 127, 102, 143, 57, 87, 93, 29, 3, 24, 17, 0, 0, 1, 1, 1, 0, 0, 0, NA, NA, NA, 0, 0, 0, NA, 0, NA, NA, NA, 0, 0, 9, 46, 95, 74, 91, 150, 167, 118, 135, 157, 54, 82, 109, 11, 105, 91, 59, 1, 0, 2, 4, 0, 0, 1, 5, 0, 0, 0, 0, NA, NA, 4, 3, 92, 51, 149, 119, 73, 63, 48, 32, 8, 10, 3, 5, 5, 0, 0, 15, 6, 11, 10, NA, NA,
+#> 4, 161, 166, 130, 171, 141, 152, 140, 102, 26, 14, 21, 7, 14, 16, 8, 14, 15, 19, 14, 2, NA, 0, 0, 1, 0, 0, 0, 55, 94, 213, 197, 211, 218, 163, 203, 177, 168, 165, 175, 165, 197, 159, 220, 148, 139, 41, 33, 1, 2, 20, 18, 7, 1, 15, 9, 22, 13, 28, 14, 25, NA, 0, 6, 2, 79, 207, 211, 238, 186, 186, 191, 101, 169, 184, 154, 113, 132, 2, 11, 3, NA, 6, 0, NA, NA, 0, 0, NA, NA, NA, NA, 0, NA, NA, 3, 5, 10, 1, 4, 0, 0, 0, 0, 1, 25, 90, 114, 139, 82, 96, 114, 101, 61, 26, 6, 2, 50, 160, 156, 143, 148, 112,
+#> 177, 152, 159, 185, 130, 120, 106, 116, 87, 45, 37, 0, 0, 0, 0, 1, 1, 0, 2, 1, 0, NA, 0, NA, 0, 0, NA, 0, NA, 134, 137, 156, 148, 151, 144, 143, 8, 128, 105, 103, 131, 120, 73, 1, 56, 26, 170, 139, 180, 160, 143, 145, 71, 63, 104, 105, 84, 47, 13, 1, 38, 30, 177, 167, 198, 188, 165, 182, 149, 159, 160, 89, 25, 110, 114, 147, 159, 163, 104, 113, 164, 145, 151, 85, 66, 48, 14, 125, 80, 165, 167, 173, 198, 169, 148, 166, 107, 49, 25, 93, 144, 121, 130, 96, 115, 154, 39, 97, 88, 111, 23, 59, 13, 11,
+#> 18, 97, 192, 163, 179, 150, 151, 78, 30, 2, 55, 110, 131, 101, 154, 180, 141, 134, 80, 13, 161, 25, 118, 30, 15, NA, NA, NA, NA, NA, 16, 13, 11, 7, 0, 5, 0, 7, 1, 10, 144, 142, 179, 164, 173, 86, 36, 3, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 1, 1, 0, 0, 0, 0, 2, 0, 12, 12, 2, 1, 0, 1, 3, 7, 8, 6, 11, 12, 10, 6, 10, 7, 0, 5, 117, 143, 154, 138, 171, 150, 141, 125, 132, 144, 103, 9, 72, 94, 134, 143, 126, 41, 81, 57, 0, 22, 97, 98, 91, 156, 170, 155, 114, 106, 16, 117, 64, 13, 165, 199, 223,
+#> 207, 234, 215, 164, 195, 210, 184, 139, 169, 9, 63, 163, 213, 186, 186, 147, 175, 152, 171, 39, 108, 102, 94, 117, 156, 159, 18, 18, 46, 109, 138, 134, 112, 132, 106, 2, 57, 39, 2, NA, NA, 0, 0, NA, NA, NA, NA, NA, NA, NA, NA, 0, 1, 1, 0, 0, 0, 0, 0, 0, 0, 0, 29, 144, 162, 187, 61, 132, 152, 90, 17, 59, 121, 121, 104, 91, 138, 120, 27, 56, 66, 13, 95, 152, 145, 152, 156, 82, 40, 110, 20, 12, 41, 106, 138, 61, 80, 97, 137, 169, 70, 57, 2, 5, 59, 72, 60, 121, 147, 119, 31, 69, 55, 3, 21, 10, 23, NA,
+#> NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 0, 0, 3, 13, 9, NA, NA, NA, 1, NA, 0, 1, 2, 2, 5, 1, 0, 0, 0, 1, 2, NA, 0, 1, 0, NA, NA, NA, NA, NA, 11, NA, NA, NA, 0, NA, NA, NA, NA, NA, 2, 1, 85, 134, 138, 167, 99, 162, 103, 187, 199, 172, 78, 149, 33, 102, 28, 61, 0, 5, 71, 102, 92, 60, 72, 97, 75, 25, 1, 39, 24, 39, 30, 115, 139, 129, 130, 118, 67, 61, 19, 88, 22, 119, 48, 148, 49, 77, 32, 142, 188, 137, 67, 201, 164, 10, 171, 123, 164, 190, 194, 119, 216, 195, 211, 155, 142, 225, 164,
+#> 141, 3, 10, 119, 46, 3, 39, 72, 144, 155, 122, 95, 141, 88, 41, 144, 120, 10, 161, 143, 113, 123, 97, 125, 28, 34, 87, 132, 104, 44, 152, 145, 72, 56, 18, 164, 122, 109, 93, 155, 97, 108, 92, 76, 127, 83, 9, 87, 66, 125, 133, 112, 48, 6, 11, 8, 133, 96, 67, 30, 57, 122, 86, 54, 23, 6, 2, 18, 191, 175, 157, 178, 153, 76, 49, 119, 161, 29, 32, 60, 42, 48, 6, 48, 27, 9, NA, 0, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 0, NA, 5, 6, 5, 10, 7, 5, 1, 7, 4, 13, 6, 2, 12, NA, 4, NA, NA, 0, NA, NA, NA, NA,
+#> NA, NA, NA, 6, 7, 11, 0, NA, 0, 0, 0, NA, 0, 0, 0, 0, 0, NA, 5, 111, 93, 124, 95, 125, 122, 111, 105, 113, 140, 111, 102, 96, 0, 10, 15, 17, 19, 11, 14, 0, 8, 15, 26, 9, NA, NA, 0, 10, 9, 0, 12, 3, 15, 99, 146, 169, 184, 162, 160, 113, 122, 48, 1, 12, 168, 118, 156, 96, 181, 159, 163, 109, 121, 151, 65, 157, 127, 42, 108, 81, 88, 110, 113, 165, 169, 113, 140, 130, 199, 100, 92, 10, 52, 3, 0, 84, 96, 143, 145, 134, 155, 135, 60, 42, 75, 46, 0, 2, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
+#> 0, 0, 12, 113, 55, 118, 30, 67, 133, 106, 111, 146, 106, 97, 63, 50, 146, 79, 153, 175, 84, 143, 66, 18, 2, 32, 8, 153, 188, 183, 183, 158, 186, 173, 172, 201, 25, 154, 138, 139, 82, 34, 0, 27, 96, 58, 99, 64, 45, 10, 10, 10, 11, 135, 192, 178, 181, 163, 42, 170, 88, 143, 87, 14, 87, 168, 184, 147, 148, 82, 79, 174, 133, 155, 190, 191, 169, 149, 45, 57, 76, 82, 3, 63, 46, 140, 160, 173, 175, 174, 109, 133, 117, 79, 103, 171, 167, 27, 56, 19, 61, 37, 0, 1, 3, NA, NA, 7, 18, 5, 2, 0, NA, NA, NA, 0,
+#> NA, 45, 107, 174, 111, 185, 140, 162, 121, 119, 158, 154, 71, 166, 171, 124, 40, 124, 68, 100, 4, 7, 0, 70, 46, 74, 88, 75, 101, 106, 120, 100, 101, 31, 15, 0, 2, 7, 1, NA, NA, 0, NA, NA, 0, NA, 0, NA, 0, NA, NA, NA, NA, NA, 117, 163, 162, 196, 177, 170, 154, 139, 128, 137, 124, 128, 169, 76, 77, 59, NA, NA, NA, NA, NA, 13, 8, 2, 2, 3, 2, 5, 9, 5, 3, 1, 1, 31, 146, 132, 161, 163, 159, 148, 140, 135, 92, 86, 46, 17, 93, 108, 132, 110, 16, 66, 56, 1, 1, 4, 6, 3, 1, 2, 5, 2, 0, NA, NA, 0, NA, 1, 0,
+#> 0, NA, 1, 10, 13, 8, 8, 18, 9, 4, 1, 4, NA, 0, 0, 0, 0, 3, 6, 4, 8, 7, 3, 5, 1, 1, 3, 91, 48, 82, 127, 158, 152, 95, 103, 110, 101, 28, 37, 9, 29, 3, 8, NA, NA, NA, 0, NA, NA, 0, NA, 0, NA, NA, NA, NA, NA, NA, 0, NA, 0, 0, 0, 0, NA, 0, NA, 0, 0, NA, 1, 0, 0, 0, 139, 103, 59, 7, 0, 21, 47, 16, 20, 11, 1, 73, 151, 148, 167, 147, 152, 79, 83, 135, 148, 182, 156, 160, 164, 157, 48, 109, 143, 74, 13, 20, 53, 43, 41, 74, 106, 99, 132, 125, 128, 84, 102, 121, 4, 101, 169, 156, 194, 170, 203, 28, 139, 147,
+#> 114, 56, 70, 35, 93, 22, 10, 16, 14, 100, 113, 48, 35, 75, 39, 5, 49, 14, 88, 94, 54, 147, 114, 164, 144, 146, 78, 56, 48, 33, 26, 114, 153, 161, 170, 175, 139, 167, 174, 191, 210, 188, 101, 180, 146, 166, 178, 156, 135, 130, 0, NA, 0, NA, NA, NA, NA, NA, NA, NA, NA, 0, 0, 0, 0, 0, 0, 3, 65, 145, 85, 143, 131, 143, 128, 23, 4, 92, 141, 86, 119, 28, 37, 9, 32, 46, 54, 52, 34, 1, 40, 108, 167, 142, 90, 21, 139, 116, 75, 27, 146, 40, 33, 1, 5, 3, 17, 10, 12, 7, 4, 9, 8, 13, NA, NA, NA, 0, NA, NA, 0,
+#> NA, 7, 13, 8, 18, 15, 14, 6, 14, 14, 10, 0, 0, 1, 3, 28, 80, 158, 158, 162, 108, 102, 18, 0, 4, 129, 40, 75, 58, 84, 61, 110, 146, 96, 42, 103, 54, 48, 31, 52, 35, 35, 10, 20, 3, 152, 159, 121, 174, 119, 60, 137, 48, 74, 211, 123, 102, 45, 110, 135, 123, 156, 52, 6, 120, 179, 179, 174, 180, 140, 67, 165, 185, 180, 173, 141, 104, 52, 41, 76, 148, 108, 146, 34, 88, 83, 18, 92, 144, 152, 144, 156, 149, 147, 181, 122, 149, 159, 155, 167, 93, 147, 156, 149, 133, 135, 12, 99, 94, 4, 5, 19, 17, 12, 18,
+#> 15, 15, 14, 11, 10, 7, 18, 11, 15, 12, 11, 10, 11, 13, 4, 5, 9, 1, 5, 2, 9, 7, 27, 140, 142, 122, 8, 105, 67, 97, 72, 21, 0, 0, 0, 0, 2, 1, NA, NA, 0, 0, 2, 1, 0, 1, 5, 1, 1, 0, 0, 0, 0, 0, 0, NA, 0, NA, NA, NA, NA, NA, NA, 0, NA, 12, 124, 109, 124, 158, 110, 104, 45, 163, 151, 123, 66, 84, 92, 106, 23, 13, 47, 40, 159, 163, 145, 153, 110, 120, 97, 52, 94, 92, 5, 46, 32, 59, 171, 158, 120, 170, 119, 95, 122, 157, 136, 190, 102, 112, 56, 33, 34, 80, 80, 11, 93, 127, 94, 122, 105, 102, 115, 91, 77,
+#> NA, NA, NA, NA, 2, 8, 10, 14, 14, 22, 10, 3, 0, 2, 2, 11, 10, 7, 17, 19, 14, 10, 14, 22, 14, 17, 9, 10, 8, 7, 8, 11, 13, 9, 12, 2, 145, 184, 168, 188, 177, 192, 120, 155, 193, 137, 166, 182, 189, 193, 157, 64, 69, 34, 11, 8, 123, 172, 167, 145, 113, 145, 168, 48, 155, 177, 109, 108, 115, 24, 71, 37, 9, 55, 12, 61, 121, 121, 85, 66, 47, 110, 11, 35, NA, 0, NA, 0, NA, NA, NA, NA, NA, NA, 0, 16, 160, 153, 174, 165, 147, 136, 159, 102, 141, 131, 96, 95, 74, 4, 17, 13, 12, 5, 11, 11, 0, 0, 2, 1, NA, 0,
+#> NA, NA, 0, NA, 0, 0, 0, 159, 178, 167, 139, 179, 197, 178, 160, 176, 113, 130, 63, 163, 160, 171, 147, 130, 179, 162, 164, 171, 183, 173, 166, 168, 152, 25, 63, 178, 185, 174, 141, 152, 184, 184, 155, 148, 191, 15, 132, 146, 65, 23, 126, 147, 49, 10, 9, 67, 128, 200, 155, 168, 158, 147, 174, 164, 153, 118, 141, 158, 143, 70, 31, 22, 146, 46, 174, 141, 141, 166, 113, 103, 115, 92, 134, 19, 87, 44, 21, 81, 6, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 2, 74, 109, 129, 108, 149, 192, 187, 186, 199, 126,
+#> 136, 128, 152, 176, 139, 164, 141, 89, 21, 82, 24, 106, 27, 144, 160, 182, 169, 185, 193, 120, 180, 181, 177, 184, 183, 143, 142, 75, 27, 46, 160, 134, 134, 133, 110, 107, 78, 7, 26, 8, 101, 141, 159, 130, 127, 151, 75, 208, 165, 166, 97, 174, 161, 129, 35, 42, 91, 2, 7, 12, 7, 12, 13, 6, 6, 17, 18, 10, 17, 0, 0, 0, 0, 10, 8, 5, 0, 0, 1, 168, 87, 16, 73, 76, 24, 1, 140, 153, 108, 164, 158, 167, 150, 176, 146, 103, 142, 96, 20, 16, 9, 41, 147, 167, 181, 32, 93, 182, 163, 179, 179, 169, 180, 144, 91,
+#> 146, 128, 9, 26, 144, 152, 166, 116, 104, 170, 158, 193, 183, 133, 173, 78, 96, 35, 0, 69, 144, 175, 182, 122, 156, 165, 163, 160, 82, 184, 88, 86, 19, 91, 143, 34, 184, 69, 76, 89, 69, 163, 111, 37, 95, 165, 163, 160, 151, 190, 166, 170, 45, 131, 94, 74, 1, 21, 31, 25, 30, 74, 123, 56, 131, 131, 77, 85, 2, 33, 71, NA, NA, NA, NA, NA, NA, 12, 5, 104, 88, 158, 180, 132, 61, 14, 102, 74, 15, 4, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 0, NA, NA, NA, 0, 0, 1, NA, 0, NA, 0, NA, 0,
+#> 0, 0, 42, 62, 99, 71, 116, 124, 73, 4, 33, 13, 26, 22, 47, 38, 6, 3, 3, 2, 2, 12, 10, 23, 15, 164, 185, 160, 149, 210, 164, 169, 140, 151, 135, 91, 48, 68, 94, 76, 123, 141, 49, 96, 85, 63, 98, 142, 143, 78, 144, 161, 158, 166, 191, 176, 156, 160, 61, 165, 154, 171, 126, 59, 47, 95, 42, 36, 149, 110, 126, 132, 122, 129, 115, 154, 27, 75, 48, 1, 29, 42, 2, 40, 85, 119, 79, 95, 18, 34, 76, 72, 41, 19, 74, 149, 180, 188, 137, 142, 207, 146, 147, 161, 145, 99, 95, 176, 157, 29, 5, 27, 46, 70, 148, 164,
+#> 167, 187, 117, 139, 132, 167, 138, 170, 151, 106, 8, 21, 3, 95, 116, 130, 200, 114, 143, 109, 154, 197, 173, 161, 173, 166, 145, 46, 64, 50, NA, NA, NA, 1, 10, 11, 3, 7, 11, 14, 10, 5, 8, 5, 11, 15, 3, 1, 0, 1, 1, 0, 0, 0, NA, NA, NA, NA, NA, 0, 0, 0, 0, 0, 14, 146, 107, 177, 166, 172, 139, 94, 165, 108, 138, 145, 47, 56, 16, 174, 129, 150, 184, 201, 5, 42, 137, 162, 156, 151, 134, 67, 121, 100, 113, 85, 81, 171, 205, 200, 139, 175, 113, 16, 131, 136, 13, 20, 52, 71, 20, 40, 10, 59, 57, 30, 47, 45,
+#> 43, 129, 87, 107, 107, 78, 25, 45, 82, 120, 41, 26, 49, 4, 130, 152, 172, 147, 173, 187, 174, 200, 181, 157, 60, 127, 123, 116, 43, 78, 192, 73, 104, 194, 86, 67, 35, NA, 2, 12, 18, 14, 9, 6, NA, NA, NA, NA, NA, NA, 0, 0, 1, 1, 0, 1, 8, 55, 74, 132, 116, 40, 78, 77, 18, 23, 157, 113, 65, 46, 19, 1, 1, 0, 0, 1, 1, 0, 0, 0, 0, 0, 0, 0, 0, 11, 88, 35, 61, 86, 32, 25, 133, 153, 188, 191, 162, 152, 105, 144, 65, 67, 49, 93, 4, 28, 30, 3, 1, 96, 138, 143, 94, 152, 157, 182, 161, 170, 133, 158, 176, 137,
+#> 104, 112, 17, NA, NA, NA, NA, 7, 9, 9, 3, 15, 17, 5, 3, 8, 0, 13, 0, 38, 118, 122, 147, 57, 160, 91, 58, 39, 98, 67, 4, 39, 121, 13, 6, 5, 23, 174, 144, 146, 175, 98, 79, 129, 116, 163, 123, 143, 20, 146, 102, 103, 28, 57, 8, 1, 1, NA, NA, NA, NA, 0, NA, NA, NA, NA, 2, 1, 12, 13, 8, 12, 7, 10, 0, 1, 1, 7, 2, 2, 101, 49, 157, 148, 149, 108, 156, 152, 70, 104, 90, 113, 101, 9, 0, 50, 15, 149, 131, 145, 149, 142, 115, 159, 178, 141, 114, 78, 63, 38, 43, 5, 79, 84, 104, 25, 75, 107, 84, 44, 117, 53,
+#> 82, 72, 9, 54, 119, 170, 177, 145, 103, 167, 195, 146, 154, 156, 151, 136, 145, 148, 111, 59, 90, 105, 17, 57, 83, 160, 122, 165, 207, 166, 205, 147, 167, 126, 15, NA, NA, 0, NA, NA, NA, NA, 0, NA, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, NA, NA, NA, NA, 0, 0, NA, 0, NA, NA, NA, 0, NA, 0, 142, 176, 93, 111, 121, 49, 123, 116, 7, 6, 10, 11, 1, 8, 12, 0, 1, 4, 9, 3, 0, 0, 9, 78, 149, 170, 184, 168, 174, 154, 162, 152, 185, 175, 162, 144, 143, 109, 74, 102, 18, 61, 1, 51, 130, 95, 155, 156, 176, 145,
+#> 114, 9, 12, 50, 1, 4, 86, 43, 163, 191, 186, 206, 169, 73, 120, 20, 126, 150, 158, 125, 4, 59, 12, 29, 89, 106, 111, 167, 147, 197, 198, 173, 219, 177, 33, 136, 112, 27, 20, 124, 64, 68, 156, 128, 151, 136, 161, 198, 180, 193, 189, 160, 144, 121, 84, 104, 25, 24, 41, 86, 142, 157, 142, 129, 137, 150, 153, 146, 154, 139, 40, 141, 119, 123, 86, 4, 78, 21, 50, 26, 15, 15, 79, 162, 131, 146, 184, 51, 155, 152, 148, 123, 150, 123, 90, 92, 64, 16, 6, 62, NA, NA, NA, NA, NA, NA, 1, 0, 3, 0, 1, 3, 0, 0,
+#> 0, 0, 0, 1, 3, 2, 7, 4, 13, 5, 4, NA, 4, 0, 2, 0, 8, 104, 136, 105, 148, 72, 79, 129, 136, 79, 116, 126, 129, 116, 80, 80, 23, 76, 73, 152, 118, 173, 168, 167, 169, 202, 165, 166, 204, 117, 147, 121, 118, 32, 52, 154, 162, 184, 163, 154, 163, 168, 192, 182, 171, 181, 131, 40, 114, 35, 97, NA, NA, NA, NA, NA, NA, 0, 0, 1, 8, 0, 0, 0, 0, 5, 13, 43, 56, 45, 99, 132, 153, 100, 123, 153, 131, 59, 59, 92, 10, 6, 6, 68, 105, 138, 122, 139, 78, 138, 117, 81, 150, 183, 110, 74, 12, 3, 1, 0, 1, 0, 1, NA, 0,
+#> 1, 0, 0, 0, 1, 1, 2, 0, 1, 3, 0, 0, 0, 0, 0, 0, 0, 0, 12, 183, 190, 203, 219, 201, 191, 191, 156, 188, 202, 214, 206, 179, 212, 179, 162, 216, 12, 149, 24, 139, 73, 47, 74, 54, 61, 43, 88, 34, 58, 47, 6, 68, 18, 37, 11, 33, 215, 176, 213, 143, 175, 201, 187, 181, 172, 194, 166, 183, 154, 127, 141, 103, 126, 38, 131, 34, 132, 62, 116, 184, 132, 42, 129, 128, 180, 168, 139, 105, 14, 99, 39, 26, 2, NA, NA, NA, 0, 1, 0, 0, 1, 1, 4, 5, 12, 0, 0, 1, 1, 1, 0, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 7, 5,
+#> 6, 6, 3, 4, 8, 1, 5, 0, 0, 0, 1, 0, 1, 0, 1, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 4, 7, 6, 8, 0, 0, 0, 0, 0, 0, 0, 6, 4, 1, 6, 1, 18, 61, 178, 154, 191, 203, 163, 176, 139, 172, 181, 156, 183, 183, 163, 164, 149, 146, 142, 98, 129, 77, 124, 134, 25, 114, 117, 37, 10, 1, 5, 16, 13, 4, 21, 24, 15, 14, 20, 20, 2, 12, 16, 4, 1, 5, 3, 9, 10, 0, 0, NA, NA, NA, 1, 2, NA, 0, 0, 0, 0, 0, 0, 0, 0, 21, 209, 195, 190, 197, 24, 197, 198, 50, 49, 65, 142, 122, 43, 45, 33, 159, 174, 113, 144, 160, 97, 57,
+#> 160, 157, 46, 154, 104, 107, 37, 108, 134, 61, 72, 15, 23, 118, 108, 86, 152, 174, 176, 149, 155, 147, 165, 134, 130, 120, 73, 40, 16, 123, 104, 91, 90, 182, 98, 91, 65, 160, 79, 48, NA, 0, 0, 8, 9, 2, 10, 11, 11, 6, 7, 0, 11, 12, 0, NA, NA, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, NA, NA, NA, NA, NA, NA, NA, NA, 4, NA, NA, NA, 1, 0, 1, 0, 0, 1, 6, 1, 0, 1, 4, 4, 16, 19, 53, 77, 102, 130, 97, 159, 117, 108, 123, 25, 68, 122, 137, 121, 99, 155, 153, 116, 206, 169, 183, 149, 9, 63, 23, 92,
+#> 158, 163, 199, 157, 148, 165, 149, 154, 148, 127, 33, 60, 64, 47, 46, NA, NA, NA, NA, NA, 5, 7, 5, 0, 0, 1, 0, 0, 1, 0, NA, NA, 0, 0, NA, NA, NA, 0, NA, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 29, 168, 129, 166, 143, 121, 38, 4, 61, 5, 7, 10, 9, 12, 10, 6, 2, 3, 0, 0, 0, 0, 0, 0, 0, 39, 72, 68, 77, 7, 23, 139, 161, 146, 120, 146, 68, 20, 53, 64, 44, 54, 85, 2, 50, 124, 127, 84, 40, 163, 52, 87, 159, 147, 134, 48, 0, 12, 30, 84, 132, 114, 152, 94, 88, 105, 29, 78, 156, 135, 117, 113, 41, 7, NA, NA,
+#> NA, 0, NA, NA, 0, NA, NA, 9, 9, 17, 5, 5, 3, 5, 10, 0, 1, 0, 1, 0, 0, 0, 0, 1, 3, 5, 8, 0, 3, 109, 118, 123, 175, 190, 164, 184, 166, 171, 157, 166, 118, 29, 130, 87, 34, 167, 132, 96, 111, 23, 54, 21, 12, 42, 112, 80, 153, 108, 28, 133, 159, 129, 103, 57, 18, 2, 82, 197, 151, 165, 111, 167, 185, 165, 45, 63, 134, 64, 2, 139, 185, 176, 188, 181, 180, 189, 179, 169, 117, 106, 133, 173, 160, 129, 84, 125, 111, 4, 40, 41, 50, 77, 4, 3, 25, 95, 39, 8, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0,
+#> 16, 194, 92, 189, 174, 160, 86, 74, 155, 140, 153, 172, 100, 56, 102, 54, 147, 164, 94, 132, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 28, 15, 132, 136, 155, 156, 196, 160, 140, 172, 123, 157, 139, 139, 162, 28, 93, 96, 163, 155, 191, 176, 111, 151, 133, 150, 102, 5, 6, 5, 98, 202, 193, 197, 184, 206, 130, 206, 165, 200, 186, 164, 113, 178, 163, 0, 0, 7, 10, 10, 16, 23, 20, 23, 22, 11, 11, 8, 5, 12, 0, 2, 14, 5, NA, NA, 0, NA, NA, NA, NA, NA, 1, 0, 1, 0, 0, 1, 2, 1, 0, 1, 1, 9, 4, 5, 2, 2, NA, NA, NA,
+#> 0, 11, 6, 10, 0, 0, 0, 1, 9, 1, 0, 2, 3, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, NA, NA, NA, NA, NA, NA, NA, 0, 15, 13, 12, NA, 4, 6, 0, 82, 62, 50, 179, 193, 100, 69, 123, 38, 141, 145, 170, 129, 172, 126, 59, 161, 159, 148, 240, 163, 177, 65, 146, 166, 21, 77, 89, 26, NA, 0, 0, NA, NA, NA, NA, NA, 0, 0, 3, 0, 2, 0, 2, 0, 0, 1, 1, 0, 0, 12, 41, 64, 78, 76, 35, 109, 83, 77, 111, 95, 107, 37, 7, 91, 177, 193, 187, 114, 48, 131, 84, 23, 74, 157, 60, 13, 11, 26, 167, 185, 216, 197, 182, 209, 190, 163, 165,
+#> 178, 79, 177, 102, 127, 57, 99, 45, 156, 152, 166, 181, 170, 178, 176, 134, 55, 113, 113, 60, 113, 7, 52, 43, 34, 20, 34, 8, 27, 46, 134, 121, 131, 27, 97, 145, 156, 148, 196, 181, 195, 150, 156, 160, 119, 149, 123, 0, 2, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 2, 0, 0, 0, 0, 0, 0, 0, 0, 0, 134, 89, 175, 194, 157, 175, 196, 157, 51, 165, 115, 27, 50, 126, 6, 36, 132, 160, 147, 142, 79, 52, 139, 136, 101, 147, 5, 99, 0, 1, 47, 96, 93, 145, 134, 137, 135, 122, 124, 129, 171,
+#> 45, 109, 95, 81, 22, 151, 188, 185, 181, 189, 192, 59, 92, 177, 216, 178, 144, 98, 84, 133, 171, 146, 161, 156, 128, 166, 194, 168, 172, 175, 164, 136, 115, 67, 75, 5, 75, 6, 166, 122, 146, 23, 70, 66, 89, 46, 79, 6, 14, 88, 139, 159, 161, 166, 131, 168, 117, 82, 22, 3, 26, 42, 78, 64, 17, 7, 1, 98, 83, 139, 145, 144, 130, 135, 114, 84, 148, 138, 108, 136, 42, 14, 34, 0, 4, 98, 94, 147, 162, 145, 141, 100, 155, 172, 153, 135, 161, 152, 167, 184, 157, 125, 242, 208, 212, 262, 206, 224, 238, 213, 225,
+#> 214, 184, 73, 105, 136, 102, 91, 10, 31, 74, 157, 89, 198, 41, 146, 191, 168, 65, 26, 41, 82, 96, 56, 27, 113, 111, 126, 139, 98, 115, 103, 100, 100, 101, 82, 47, 28, 14, 4, 73, 97, 100, 173, 148, 186, 67, 96, 139, 171, 192, 186, 70, 116, 130, 79, 28, 0, 0, 49, 84, 10, 28, 48, 126, 123, 71, 114, 148, 95, 62, 56, 115, 51, 28, NA, NA, NA, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 194, 185, 212, 196, 195, 177, 185, 187, 186, 183, 173, 173, 101, 172, 147, 4, 120, 94, 162, 107, 76, 54, 131, 142, 146,
+#> 206, 192, 198, 151, 176, 98, 157, 159, 129, 89, 9, 76, 28, 110, 157, 138, 206, 138, 140, 35, 63, 120, 132, 83, 115, 26, 0, 1, 0, 0, 0, 9, 7, 1, 0, 0, NA, 0, 0, 0, 0, 0, 0, 0, 0, 1, 26, 159, 129, 148, 121, 130, 125, 123, 61, 95, 153, 85, 89, 44, 0, 70, 107, 38, 97, 16, 2, 18, 11, 12, 43, 27, 0, 0, 0, 0, 0, 1, 0, 7, 6, 6, 6, 0, 4, 5, 0, 0, 26, 133, 85, 105, 115, 93, 121, 123, 137, 155, 130, 52, 42, NA, 0, NA, 0, 0, 1, 1, 0, 6, 0, 0, 0, 0, 20, 85, 149, 167, 166, 204, 177, 203, 199, 214, 152, 179, 199,
+#> 108, 63, 77, 45, 0, 0, 0, 0, 0, 0, 0, 158, 109, 140, 125, 23, 52, 38, 94, 19, 27, 72, 55, 26, 9, 4, 19, 12, 17, 6, 8, 2, 0, 0, 1, 9, 154, 209, 198, 170, 171, 179, 173, 127, 115, 128, 116, 147, 92, 56, 50, 5, 120, 173, 189, 183, 188, 185, 194, 195, 201, 133, 163, 152, 124, 163, 133, 28, 0, 0, 0, 0, 0, 0, 1, 0, 1, 10, 6, 7, 9, 12, 8, 9, 2, 0, 0, 2, 1, 7, 7, 9, 3, 2, 0, 1, 0, 0, 1, 0, 1, 7, NA, 0, 0, 0, 0, 1, 0, 0, 0, 2, 0, 0, 13, 9, 9, 0, 2, 4, 6, 0, 0, 0, 0, 0, 0, 0, 0, 14, 106, 45, 134, 158, 157,
+#> 146, 168, 199, 50, 180, 181, 163, 37, 105, 82, 34, 43, 63, 31, 147, 180, 141, 185, 187, 164, 132, 173, 106, 59, 73, 147, 58, 49, 49, 89, 84, 146, 158, 114, 135, 132, 43, 3, 47, 52, 60, 6, 0, 2, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 163, 134, 164, 111, 1, 52, 3, 4, 14, 15, 24, 11, 18, 0, 0, 1, 0, 12, 66, 114, 157, 120, 150, 62, 94, 2, 171, 113, 153, 27, 23, 0, 30, 167, 215, 146, 167, 185, 143, 128, 164, 161, 110, 56, 99, 42, 45, 150, 200, 155, 190, 158, 121, 85, 134, 172, 72, 4, 78, 137, 156, 165,
+#> 136, 175, 118, 163, 191, 115, 129, 52, 64, 49, 174, 118, 168, 144, 96, 7, 11, 8, 8, 14, 12, 4, 4, 5, 3, 5, 11, 19, 10, 0, 6, 1, 0, 16, 77, 0, 117, 71, 112, 129, 175, 180, 160, 182, 110, 129, 140, 162, 103, 160, 136, 144, 0, 0, 1, 1, 3, 1, 0, 2, 11, 7, 11, 3, 36, 102, 140, 193, 114, 17, 30, 47, 34, 109, 99, 109, 6, 38, 2, 27, 0, 130, 92, 82, 79, 132, 53, 2, 35, 23, 2, 116, 183, 163, 133, 54, 111, 142, 90, 109, 32, 42, 137, 153, 194, 177, 66, 85, 108, 69, 178, 154, 146, 113, 8, 95, 100, 5, 58, 56,
+#> 109, 130, 109, 187, 168, 171, 128, 146, 117, 90, 29, 9, 46, 147, 167, 181, 169, 74, 71, 107, 149, 178, 182, 188, 108, 13, 43, 120, 137, 170, 99, 111, 28, 58, 185, 208, 113, 181, 132, 73, 42, 42, 148, 148, 126, 151, 134, 200, 154, 166, 164, 148, 119, 189, 144, 194, 199, 178, 163, 68, 2, 11, 145, 93, 125, 123, 9, 5, 47, 155, 183, 182, 170, 176, 173, 173, 168, 69, 94, 171, 180, 165, 146, 127, 5, 48, 33, 87, 133, 143, 201, 151, 148, 141, 83, 71, 24, 48, 9, 43, 12, 1, 16, 31, 151, 156, 164, 173, 104,
+#> 156, 163, 177, 142, 105, 151, 171, 163, 159, 114, 43, 15, 89, 120, 121, 107, 83, 158, 72, 140, 126, 103, 126, 122, 55, 1, 0, 1, 6, 6, 5, 0, 4, 4, 7, 4, 9, 5, 9, 1, 1, 5, 5, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 1, 0, 1, 1, 5, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 2, 8, NA, 0, 0, 0, 1, 1, 5, 5, 9, 0, 0, 11, 8, 11, 1, 53, 127, 132, 125, 166, 152, 124, 156, 133, 98, 27, 26, 1, 56, 130, 111, 51, 124, 123, 137, 132, 87, 111, 93, 76, 26, 49, 9, 10, 7, 10, 13, 10, 8, 15, 6, 4, 4, 3, 0, 2, 0, 0, 0, 0, 0,
+#> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 11, 90, 182, 142, 153, 172, 152, 141, 57, 76, 127, 107, 2, 32, 112, 113, 149, 91, 52, 13, 15, 7, 127, 58, 118, 99, 47, 131, 117, 115, 54, 30, 19, 3, 84, 177, 198, 195, 188, 180, 198, 180, 197, 205, 193, 191, 145, 144, 172, 150, 130, 181, 180, 164, 111, 76, 190, 137, 183, 149, 161, 74, 71, 0, 1, 5, 1, 21, 27, 14, 10, 12, 11, 3, 0, 8, 0, 9, 5, 3, 46, 64, 42, 64, 169, 92, 77, 148, 60, 76, 104, 83, 4, 87, 8, 21, 69, 29, 124, 175, 176, 161, 180, 181, 179, 64,
+#> 36, 12, 66, 75, 53, 140, 130, 178, 179, 214, 165, 178, 166, 189, 197, 169, 144, 168, 155, 146, 152, 46, 0, 96, 150, 204, 216, 221, 217, 201, 183, 174, 186, 213, 169, 16, 129, 4, 22, 16, 147, 163, 155, 48, 105, 126, 163, 121, 10, 32, 29, 61, 102, 173, 61, 97, 142, 150, 116, 50, 136, 200, 178, 176, 165, 130, 78, 98, 166, 178, 114, 156, 185, 146, 134, 14, 72, 131, 118, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 5, 6, 6, 11, 6, 10, 0, 66, 201, 177, 51, 109, 159, 172, 146, 145, 151, 79, 155, 163, 137,
+#> 99, 30, 24, 76, 117, 190, 160, 187, 139, 102, 60, 135, 128, 20, 160, 52, NA, NA, 0, 6, NA, 1, 0, 2, 0, 0, 12, 4, 12, 12, 8, 7, 6, 1, 4, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 2, 0, 0, 185, 212, 177, 197, 163, 82, 68, 87, 105, 127, 100, 155, 165, 189, 162, 204, 200, 188, 196, 190, 187, 179, 5, 11, 57, 140, 117, 109, 154, 36, 83, 75, 33, 144, 181, 119, 176, 191, 167, 85, 174, 144, 126, 157, 32, 71, 158, 203, 176, 177, 161, 117, 103, 77, 135, 159, 25, 54, 50, 147,
+#> 136, 153, 137, 129, 126, 101, 91, 115, 108, 116, 147, 196, 216, 173, 99, 83, 186, 132, 177, 156, 156, 64, 0, 1, 18, 16, 24, 11, 20, 28, 15, 12, 14, 6, 84, 56, 190, 194, 191, 204, 41, 159, 181, 184, 113, 175, 50, 82, 77, 176, 181, 196, 189, 164, 166, 99, 178, 132, 144, 44, 22, 105, 191, 169, 155, 172, 137, 169, 156, 173, 126, 73, 27, 147, 21, 62, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 69, 27, 112, 116, 61, 9, 138, 121, 107, 95, 111, 98, 58, 0, 8, 7, 86, 166, 112, 166, 163, 57, 167, 106, 127, 43,
+#> 147, 42, 0, 1, 3, 1, 2, 2, 2, 1, 11, 1, 1, 0, 0, 0, 0, 0, 7, 4, 10, 10, 10, 17, 13, 0, 2, 1, 0, 0, 1, 0, 0, 0, 7, 54, 22, 159, 152, 168, 150, 111, 111, 34, 69, 23, 34, 185, 190, 174, 170, 108, 27, 60, 40, 41, 24, 45, 117, 158, 155, 126, 82, 99, 89, 99, 110, 106, 77, 169, 188, 143, 76, 90, 95, 18, 171, 132, 38, 12, 2, 84, 36, 78, 45, 151, 156, 106, 189, 149, 130, 76, 77, 17, 180, 156, 165, 190, 196, 191, 212, 154, 168, 85, 152, 158, 151, 131, 116, 17, 154, 165, 162, 177, 151, 170, 182, 174, 37, 187,
+#> 1, 46, 58, 73, 185, 206, 170, 160, 115, 118, 141, 56, 69, 36, 68, 12, 26, NA, NA, NA, NA, NA, NA, 0, NA, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 165, 213, 185, 87, 195, 163, 193, 153, 111, 146, 174, 203, 188, 187, 191, 67, 141, 144, 20, 15, 2, 14, 3, 4, 0, NA, 0, 0, NA, 0, 0, 2, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 6, 2, 4, 0, 3, 3, 5, 9, 17, 9, 10, 11, 15, 10, 13, 6, 1, 0, 0, 1, 0, 1, 0, 0, 0, 7, 0, 0, 15, 10, 11, 6, 2, 0,
+#> 0, 0, 0, 0, 0, 0, 0, 0, 0, 4, 11, 10, 7, 5, 4, 6, 3, 3, 10, 34, 173, 182, 172, 153, 176, 213, 145, 43, 171, 163, 157, 8, 77, 4, 0, 148, 187, 146, 161, 172, 183, 163, 158, 123, 173, 36, 97, 90, 97, 135, 141, 122, 145, 159, 161, 114, 132, 28, 63, 85, 165, 87, 43, 46, 61, 56, 8, 137, 24, 11, 5, 119, 128, 167, 181, 152, 145, 51, 101, 140, 33, 23, 18, 59, 10, 65, 181, 122, 60, 105, 174, 140, 173, 157, 160, 97, 112, 173, 171, 86, 141, 69, 48, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 4, 122, 164, 169, 118, 79, 165,
+#> 158, 163, 0, 5, 21, 141, 72, 90, 96, 35, 29, 40, 11, 9, 41, 35, 102, 142, 198, 178, 150, 56, 65, 154, 182, 109, 20, 165, 128, 15, 87, 190, 90, 186, 145, 160, 144, 89, 43, 42, 49, 138, 83, 110, 107, 74, 76, 23, 19, 36, 4, 11, 9, 81, 161, 129, 44, 79, 26, 90, 116, 31, 87, 67, 177, 185, 194, 183, 184, 121, 185, 184, 129, 33, 123, 103, 48, 99, 159, 177, 54, 195, 108, 39, 89, 184, 95, 122, 72, 0, 0, 0, 1, 0, 0, 2, 1, 0, 7, 0, 7, 19, 12, 15, 16, 16, 129, 131, 165, 159, 186, 186, 181, 147, 0, 0, 1, 1, 0,
+#> 0, 0, 0, 1, 1, 0, 1, 3, 0, 0, 1, 23, 176, 174, 121, 178, 161, 114, 163, 156, 60, 86, 1, 33, 107, 173, 142, 63, 130, 171, 138, 114, 30, 71, 39, 100, 176, 180, 150, 195, 122, 71, 155, 158, 0, 3, 18, 16, 16, 14, 8, 15, 13, 0, 110, 114, 155, 146, 142, 60, 24, 8, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 162, 96, 62, 13, 50, 109, 110, 22, 69, 92, 179, 135, 125, 82, 134, 93, 139, 122, 127, 160, 162, 151, 142, 158, 131, 85, 116, NA, 0, 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 0, 179, 174, 192, 52, 156, 99,
+#> 125, 132, 130, 14, 0, 1, 0, 0, 0, 1, 0, 0, 3, 5, 11, 1, 0, 0, 1, 1, 0, 9, 6, 20, 6, 4, 15, 8, 12, 6, 2, 7, 0, 0, 1, 1, 0, 0, 1, 1, 0, 0, 0, 0, 37, 72, 99, 160, 139, 72, 39, 36, 50, 73, 79, 197, 142, 157, 118, 62, 150, 3, 1, 0, 0, 0, 0, 9, 10, 12, 7, 10, 6, 9, 4, 6, 23, 177, 99, 161, 148, 162, 52, 139, 107, 97, 39, 3, 5, 8, 2, 4, 94, 135, 76, 12, 79, 148, 155, 80, 117, 158, 136, 27, 156, 151, 177, 185, 126, 177, 56, 171, 4, 4, 1, 53, 7, 58, 120, 151, 120, 21, 97, 127, 88, 51, 2, 2, 7, NA, NA, 0, 0,
+#> 0, 0, 1, 0, 0, 0, 2, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 2, 124, 46, 178, 153, 170, 177, 139, 150, 165, 165, 157, 181, 170, 145, 172, 155, 138, 137, 169, 140, 115, 80, 21, 0, 22, 10, 1, 10, 16, 15, 11, 12, 6, 2, 1, 29, 72, 38, 120, 127, 125, 152, 110, 166, 178, 10, 71, 99, 147, 121, 120, 109, 41, 155, 188, 15, 212, 82, 172, 156, 116, 2, 5, 3, 16, 12, 14, 11, 9, 102, 111, 131, 131, 123, 32, 69, 134, 128, 38, 52, 185, 189, 168, 150, 96, 143, 191, 182,
+#> 188, 187, 182, 125, 172, 177, 181, 10, 46, 96, 157, 135, 155, 150, 149, 164, 161, 132, 95, 130, 105, 161, 105, 33, 53, 106, 96, 122, 183, 189, 174, 192, 168, 149, 135, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 9, 0, 0, 0, 0, 0, 0, 17, 67, 137, 89, 75, 85, 34, 6, 44, 155, 185, 155, 157, 115, 153, 138, 49, 128, 150, 45, 91, 161, 105, 165, 150, 123, 93, 40, 134, 31, 89, 158, 135, 171, 155, 147, 153, 136, 0, 4, 0, 18, 2, 0, 0, 40, 186, 167, 112, 170, 46, 81, 153, 71, 16, 73, 47, 4, 129, 149, 103, 133,
+#> 117, 201, 159, 96, 171, 172, 50, 189, 151, 134, 112, 146, 164, 115, 0, 1, 0, 0, 0, 1, 0, 13, 8, 11, 2, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 1, 0, 0, 0, 0, 0, 0, 0, 10, 12, 71, 148, 87, 96, 143, 92, 31, 164, 161, 95, 91, 142, 158, 158, 142, 90, 90, 117, 140, 153, 133, 69, 5, 80, 146, 26, 155, 121, 128, 89, 19, 146, 139, 104, 47, 10, 0, 7, 4, 89, 142, 161, 110, 173, 130, 50, 64, 150, 124, 163, 148, 194, 185, 172, 165, 144, 90, 158, 97, 155, 160, 8, 16, 124, 94, 97, 88, 138, 162, 174,
+#> 118, 102, 88, 145, 1, 27, 182, 190, 173, 172, 144, 116, 96, 172, 3, 6, 27, 110, 132, 152, 128, 118, 150, 124, 150, 151, 128, 133, 133, 137, 65, 20, 122, 5, 7, 139, 138, 89, 111, 99, 120, 135, 81, 17, 47, 0, 0, 105, 77, 143, 150, 141, 164, 107, 131, 1, 0, 13, 7, 6, 5, 23, 141, 148, 150, 168, 151, 136, 0, 0, 0, 0, 0, 0, 0, 0, 0, 12, 0, 0, 0, 1, 0, 15, 153, 124, 188, 136, 178, 50, 189, 91, 181, 49, 87, 145, 150, 138, 39, 147, 182, 122, 182, 130, 124, 177, 29, 149, 72, 72, 52, 108, 152, 163, 36, 75,
+#> 48, 150, 132, 142, 3, 1, 8, 98, 72, 57, 11, 2, 3, 84, 93, 23, 34, 19, 139, 167, 88, 150, 1, 87, 199, 162, 156, 89, 45, 128, 130, 92, 106, 4, 29, 25, 89, 111, 158, 151, 62, 162, 165, 150, 93, 162, 63, 98, 45, 6, 59, 100, 142, 169, 18, 96, 141, 150, 163, 0, 0, 7, 6, 3, 6, 0, 3, 4, 0, 2, 4, 107, 174, 122, 8, 61, 177, 20, 27, 0, 0, 0, 1, 0, 47, 154, 160, 158, 166, 2, 0, 0, 1, 15, 68, 113, 132, 170, 95, 117, 114, 69, 165, 143, 93, 135, 130, 106, 155, 74, 0, 7, 7, 11, 6, 17, 19, 176, 178, 10, 11, 61, 167,
+#> 177, 225, 200, 20, 86, 135, 84, 35, 73, 120, 159, 158, 200, 164, 7, 126, 163, 132, 120, 139, 146, 93, 176, 82, 2, 38, 119, 139, 177, 142, 165, 157, 6, 5, 7, 0, 1, 0, 0, 2, 7, 12, 0, 87, 133, 142, 127, 54, 102, 118, 66, 4, 55, 134, 161, 68, 69, 22, 176, 205, 20, 119, 80, 192, 43, 143, 144, 166, 40, 108, 124, 121, 130, 5, 66, 174, 155, 184, 41, 135, 125, 166, 188, 172, 140, 108, 154, 46, 35, 13, 173, 56, 132, 167, 36, 44, 165, 57, 95, 74, 139, 168, 11, 129, 196) x c(1, 2, 3, 4, 5, 6, 7, 8, 9, 11, 11, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 19, 20, 1, 2, 3, 4, 5, 6, 7, 8, 9, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 12, 13, 14, 1, 3, 4, 5, 6, 7, 8, 9, 10, 11, 11, 12, 13, 1, 2, 3, 4, 5, 6, 7, 9, 10, 13, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 17, 18, 19, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 22, 22, 1, 2, 3, 4, 5, 6, 7, 7,
+#> 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 1, 3, 4, 5, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 17, 1, 2, 3, 4, 5, 6, 7, 8, 9, 9, 10, 10, 11, 12, 13, 14, 15, 1, 2, 3, 4, 4, 5, 6, 7, 8, 9, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 17, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 16, 18, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 1, 3, 4, 5, 6, 7, 8, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 1, 2,
+#> 3, 4, 5, 6, 7, 8, 9, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 18, 19, 21, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 22, 23, 24, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 22, 23, 24, 25, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 1, 4, 5, 6, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 1, 2, 3, 4, 5, 6, 7, 8, 9, 11, 12, 12, 13, 14, 1, 2, 3, 4, 5, 6, 6, 7, 8, 10, 13, 13, 14, 16, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15,
+#> 16, 17, 18, 20, 21, 22, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 12, 13, 14, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 18, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 16, 21, 28, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 1, 2, 3, 4, 5, 6, 7, 8, 9, 9, 10, 11, 12, 13, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 13, 14, 14, 15, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14,
+#> 15, 16, 17, 18, 19, 20, 21, 22, 23, 24, 25, 1, 3, 4, 5, 6, 7, 8, 9, 10, 11, 1, 2, 2, 2, 5, 6, 7, 8, 9, 28, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 22, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 12, 13, 14, 1, 2, 3, 4, 5, 6, 7, 8, 10, 11, 12, 13, 14, 15, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 14, 15, 16, 1, 2, 3, 4, 5, 6, 7, 8,
+#> 9, 10, 11, 12, 13, 14, 1, 2, 4, 5, 6, 7, 8, 9, 10, 11, 13, 14, 15, 16, 17, 18, 19, 20, 21, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 15, 16, 17, 18, 21, 1, 3, 4, 5, 6, 7, 8, 9, 10, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 10, 11, 12, 13, 14, 14, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 1, 2, 3, 4, 5, 6, 7, 8, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 15, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 23, 1, 4, 6, 7, 8, 9, 10, 11,
+#> 12, 13, 14, 15, 15, 15, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 14, 15, 16, 1, 2, 3, 4, 4, 6, 7, 1, 2, 3, 4, 5, 6, 7, 9, 10, 11, 12, 14, 15, 1, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 20, 1, 2, 3, 4, 4, 5, 6, 8, 15, 1, 2, 3, 4, 5, 6, 7, 8, 8, 9, 10, 11, 12, 13, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 14, 15, 1, 2, 3, 4, 5, 6, 7, 8, 9, 9, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 16, 17, 18, 19, 20, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 1, 2, 3, 4, 5, 6, 7,
+#> 8, 9, 10, 10, 11, 12, 13, 14, 1, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 1, 2, 3, 4, 5, 6, 7, 8, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 12, 13, 14, 14, 15, 1, 5, 6, 7, 8, 9, 10, 11, 12, 14, 15, 17, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 10, 11, 12, 13, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 1, 2, 3, 4, 5, 6, 7, 8, 9, 1, 2,
+#> 3, 4, 5, 6, 7, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 1, 3, 4, 5, 6, 6, 7, 8, 9, 11, 12, 13, 13, 15, 1, 2, 3, 4, 5, 6, 7, 8, 8, 9, 10, 12, 1, 2, 3, 4, 5, 1, 2, 2, 5, 6, 7, 8, 9, 10, 11, 12, 13, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 1, 2, 3, 4, 5, 6, 7, 8, 9, 12, 13, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 22, 24, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10,
+#> 11, 12, 13, 14, 15, 16, 19, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 1, 2, 3, 7, 1, 2, 3, 4, 5, 6, 1, 2, 3, 4, 5, 6, 7, 8, 9, 1, 2, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 1, 2, 3, 4, 5, 6, 7, 8, 8, 9, 10, 11, 12, 13, 14, 15, 16, 1, 2, 3, 4, 5, 6, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 1, 2, 3, 4, 5, 6, 7, 9, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 10, 11, 12, 13, 14, 14, 15, 16, 1, 2,
+#> 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 22, 1, 2, 3, 4, 4, 5, 6, 7, 8, 9, 9, 10, 11, 12, 12, 13, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 19, 20, 21, 22, 23, 1, 2, 2, 3, 4, 5, 6, 7, 8, 10, 11, 12, 13, 14, 14, 15, 16, 20, 21, 1, 3, 4, 5, 6, 8, 8, 9, 10, 10, 11, 1, 2, 3, 4, 5, 6, 7, 8, 9, 1, 2, 3, 4, 5, 6, 1, 4, 5, 6, 7, 8, 8, 9, 10, 11, 12, 13, 14, 15, 16, 1, 2, 3, 4, 5, 6, 7, 8, 9, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 1, 2, 3, 4, 4, 5,
+#> 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 19, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 17, 18, 19, 20, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 15, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 17, 18, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 1, 3, 4, 5, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 1, 2, 3, 4, 5, 6, 7, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 15, 16, 17, 18, 18, 19, 19, 19, 1, 3, 4, 4, 5,
+#> 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 1, 3, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 17, 17, 1, 2, 3, 4, 5, 6, 7, 8, 9, 9, 10, 11, 12, 13, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 1, 5, 6, 7, 8, 9, 10, 11, 12, 1, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 12, 13, 13, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 1, 2, 3, 4, 5, 6, 7, 8, 9,
+#> 10, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 1, 2, 3, 4, 5, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 1, 2, 3, 3, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 16, 18, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 1, 2, 3, 4, 5, 5, 6, 7, 8, 9, 10, 11, 12, 12, 13, 13, 14, 15, 1, 2, 3, 4, 5, 6, 6, 7, 8, 9, 10, 11, 12, 13, 15, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 15, 16, 16, 17, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10,
+#> 11, 12, 13, 1, 2, 3, 4, 5, 6, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 22, 1, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 10, 11, 1, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 1, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 20, 1, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 19, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 15, 15, 16, 18, 1, 2, 3, 5, 6, 7, 8, 9, 10, 11, 12, 12, 13, 14, 15, 16, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 1, 3, 4, 5, 6, 7, 8, 9, 10, 11,
+#> 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 11, 12, 13, 14, 14, 15, 16, 17, 18, 19, 20, 20, 21, 1, 2, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 22, 1, 2, 3, 4, 5, 6, 7, 8, 10, 11, 1, 1, 4, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 20, 21, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 19, 20, 1, 2, 9, 10, 11, 12, 13, 14, 15, 1, 2, 3, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 1, 1, 2, 3, 4, 5, 8, 9, 10,
+#> 11, 1, 2, 3, 4, 4, 5, 6, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 22, 23, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 18, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 1, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 17, 18, 19, 20, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16,
+#> 16, 17, 18, 20, 21, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 10, 11, 12, 13, 14, 15, 16, 17, 18, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 24, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 15, 16, 17, 18, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 1, 2, 3, 4, 5, 5, 6, 6, 7, 8, 9, 10, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 10, 11, 11, 12, 1, 2, 3, 4, 5, 6, 7, 7, 8, 9, 10, 11, 12, 13, 14, 15, 15, 16, 16, 1, 2, 3, 4, 5, 6, 7,
+#> 8, 9, 9, 10, 11, 12, 13, 1, 2, 3, 4, 5, 6, 7, 8, 8, 9, 10, 11, 12, 13, 14, 15, 16, 16, 17, 1, 4, 5, 6, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 11, 12, 13, 14, 1, 5, 6, 7, 8, 9, 10, 10, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 14, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 13, 14, 14, 15,
+#> 15, 16, 17, 18, 19, 20, 20, 21, 1, 2, 3, 4, 5, 6, 7, 7, 8, 9, 10, 10, 11, 12, 12, 1, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 1, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 16, 17, 18, 19, 19, 20, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 1, 2, 3, 4, 5, 6, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 15, 15, 16, 18, 18, 19, 1, 2, 2, 3, 4, 5, 5, 6,
+#> 7, 8, 9, 9, 10, 11, 1, 7, 8, 9, 10, 1, 2, 3, 4, 5, 5, 6, 7, 8, 8, 9, 10, 11, 12, 13, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 14, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 13, 14, 15, 15, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 1, 2, 3, 4, 5, 7, 8, 9, 10, 11, 11, 12, 13, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 22, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 8, 9, 9, 1, 2, 3,
+#> 4, 5, 6, 7, 8, 9, 10, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 11, 12, 12, 13, 14, 15, 1, 2, 3, 4, 5, 6, 6, 7, 8, 8, 9, 10, 12, 13, 13, 14, 20, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 1, 2, 4, 5, 10, 11, 12, 13, 14, 15, 15, 16, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 18, 20, 21, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 11, 12, 13, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17,
+#> 18, 19, 20, 1, 2, 5, 6, 7, 8, 9, 10, 11, 12, 12, 13, 14, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 10, 11, 12, 1, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 1, 2, 3, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 13, 14, 15, 16, 17, 18, 19, 1, 2, 3, 4, 5, 6, 7, 8, 9, 9, 10, 11, 12, 12, 13, 14, 15, 16, 17, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 13, 14, 16, 1, 2, 3, 4, 5, 6, 7,
+#> 8, 9, 10, 11, 11, 12, 13, 16, 16, 17, 1, 4, 5, 6, 7, 8, 9, 10, 10, 11, 11, 12, 13, 14, 1, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 18, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 15, 16, 17, 20, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 19, 1, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 17, 17, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 12, 13, 14, 15, 16, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 16, 17, 1, 2, 3, 4, 5, 6, 7, 8,
+#> 8, 9, 9, 10, 11, 11, 1, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 13, 14, 15, 16, 17, 18, 19, 20, 1, 2, 3, 4, 5, 6, 7, 8, 9, 9, 10, 11, 12, 12, 13, 14, 14, 15, 16, 17, 1, 2, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 11, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 16, 17, 1, 4, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 10, 11, 14, 15, 16, 17, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16,
+#> 17, 18, 19, 20, 21, 22, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 16, 1, 4, 5, 6, 7, 8, 9, 10, 11, 12, 16, 17, 18, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 15, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 1, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 17, 1, 3, 4, 5, 6, 7, 8, 9, 10, 1, 2, 3, 4, 5, 6, 7, 11, 12, 13, 14, 15, 16, 1, 2, 3, 4, 5, 6, 6, 7, 8, 8, 9, 10, 11, 11, 12, 12, 1, 2, 3, 4, 5, 6, 7, 8,
+#> 9, 10, 10, 11, 12, 12, 13, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 12, 13, 14, 15, 16, 17, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 16, 17, 18, 19, 20, 21, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 10, 11, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 13, 14, 1, 2, 3, 4, 5, 6, 7, 7, 8, 9, 10, 10, 11, 12, 13, 14, 15, 16, 18, 1, 2, 4, 6, 7, 8, 9, 10, 10, 11, 1, 2, 3, 4, 5, 6, 6, 7, 8, 9, 9, 10, 11, 12, 1, 2, 3, 4, 4, 9, 1, 2, 3, 4, 5, 6, 7, 11, 12, 13,
+#> 14, 14, 15, 16, 17, 18, 1, 2, 4, 5, 6, 7, 8, 9, 10, 10, 11, 12, 13, 1, 2, 3, 4, 5, 6, 6, 7, 8, 9, 1, 4, 5, 6, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 22, 23, 24, 1, 2, 3, 4, 4, 5, 6, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 15, 16, 17, 19, 20, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 11, 12, 13, 14, 1, 2, 4, 6, 7, 7, 8, 9, 9, 10, 11, 11, 12, 13, 14, 14, 15, 15, 15, 16, 17, 18, 18, 19, 19, 20, 24, 24, 25, 1, 2, 3, 4, 5, 6, 7, 10, 11, 12, 13, 14, 15, 1, 4, 5,
+#> 6, 7, 8, 9, 10, 11, 12, 13, 14, 14, 15, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 10, 11, 12, 12, 13, 14, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 1, 2, 3, 4, 5, 6, 9, 10, 11, 12, 13, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 1, 2, 3, 4, 5, 6, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 1, 2, 3, 4, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 1, 2, 3, 4, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 22,
+#> 1, 2, 3, 4, 4, 5, 6, 7, 8, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 20, 1, 2, 3, 3, 4, 5, 6, 7, 7, 8, 9, 10, 11, 12, 13, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 14, 15, 15, 16, 16, 1, 2, 3, 4, 5, 6, 7, 8, 13, 14, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 10, 11, 12, 1, 2, 4, 5, 6, 7, 8, 9, 10, 10, 11, 12, 13, 13, 14, 14, 15, 1, 2, 3, 4, 5, 7, 8, 9, 10, 11, 12, 13, 14, 1, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 1, 2, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 1, 2, 3,
+#> 4, 5, 6, 7, 9, 10, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 1, 2, 3, 1, 2, 3, 4, 5, 6, 7, 8, 9, 13, 14, 15, 1, 2, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 13, 1, 2, 3, 4, 5, 6, 7, 10, 1, 2, 3, 4, 5, 5, 6, 7, 8, 9, 11, 12, 13, 14, 15, 16, 17, 1, 2, 3, 4, 7, 8, 9, 1, 2, 3, 4, 5, 6, 7, 9, 10, 11, 1, 2, 3, 4, 5, 1, 2, 3, 7, 8, 9, 10, 11, 12, 13, 1, 2, 3, 3, 4, 5, 6, 7, 10, 11, 11, 12, 13, 13, 14, 1, 2, 3, 4, 5, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 18, 19, 19, 20, 21, 22, 22, 1, 2, 3, 4, 5, 6,
+#> 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 1, 2, 3, 4, 5, 6, 7, 1, 2, 3, 4, 5, 6, 7, 8, 10, 11, 12, 13, 14, 1, 2, 3, 4, 6, 7, 8, 9, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 1, 2, 3, 6, 7, 8, 9, 10, 11, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 1, 2, 3, 4, 5, 7, 8, 9, 10, 10, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 13, 14, 15, 15, 1, 2, 3, 4, 5, 6, 7, 8, 8, 9, 10, 10, 12, 1, 2, 6, 7, 8, 1, 2, 6, 7, 8, 9, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 13, 14, 1, 2, 3, 4, 5, 6, 7, 8, 9, 13, 14, 15,
+#> 18, 1, 5, 6, 7, 8, 9, 10, 11, 11, 12, 13, 13, 1, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 14, 15, 1, 4, 5, 6, 7, 8, 9, 9, 10, 11, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 14, 19, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 1, 3, 4, 6, 7, 8, 9, 10, 12, 1, 2, 3, 4, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 22, 23, 1, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 10, 11, 11, 12, 13, 14, 15, 15, 16, 17, 18, 1, 2, 3, 4, 4, 5, 6, 7, 8, 9, 10, 10, 1, 2, 3, 4,
+#> 5, 6, 7, 8, 8, 9, 10, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 15, 1, 2, 3, 4, 5, 7, 8, 1, 2, 3, 3, 4, 5, 5, 6, 7, 7, 1, 2, 3, 4, 5, 6, 6, 7, 8, 9, 1, 2, 3, 4, 5, 6, 7, 8, 10, 11, 12, 13, 14, 15, 1, 3, 4, 5, 6, 6, 7, 8, 9, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 1, 2, 4, 5, 6, 7, 8, 9, 10, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 11, 13, 14, 14, 15, 16, 1, 2, 3, 4, 4, 12, 13, 14, 15, 1, 2, 3, 4, 5, 6, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10,
+#> 11, 12, 13, 13, 14, 15, 16, 17, 1, 2, 3, 4, 5, 6, 7, 7, 1, 2, 3, 3, 4, 5, 5, 5, 6, 7, 8, 8, 9, 10, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 22, 1, 2, 3, 4, 5, 6, 7, 8, 9, 1, 2, 3, 4, 5, 6, 7, 8, 9, 9, 10, 11, 12, 13, 14, 15, 16, 17, 1, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 1, 2, 3, 4, 4, 5, 6, 7, 8, 9, 9, 9, 10, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 1, 2, 3, 4, 7, 8, 9, 9, 10, 11, 12, 13, 1, 2, 3, 4, 5, 6, 9, 10, 10, 1, 2, 3, 8, 9, 10, 10, 1, 2, 3, 8, 9, 10, 11, 12,
+#> 13, 1, 2, 3, 4, 5, 8, 9, 10, 11, 12, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 22, 1, 2, 3, 4, 4, 5, 6, 7, 8, 9, 10, 10, 11, 12, 12, 13, 14, 14, 15, 1, 3, 4, 5, 6, 7, 8, 9, 9, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 1, 2, 3, 6, 7, 8, 9, 10, 11, 11, 12, 13, 13, 14, 15, 16, 16, 1, 2, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 1, 2, 3, 4, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 14, 1, 5, 6, 7, 8, 9, 10, 10, 11, 12, 13, 14, 14, 1, 2, 3, 7, 8, 9, 10, 11, 12,
+#> 13, 14, 15, 16, 17, 18, 19, 1, 2, 3, 7, 8, 9, 10, 11, 12, 13, 14, 1, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 20, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 1, 2, 3, 4, 5, 6, 10, 11, 12, 13, 14, 1, 2, 3, 4, 5, 6, 6, 7, 9, 10, 11, 1, 5, 6, 7, 8, 9, 10, 11, 11, 12, 14, 1, 2, 3, 4, 5, 6, 7, 8, 8, 9, 10, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 10, 11, 11, 13, 1, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 22, 23, 24, 24, 1, 5, 6, 7,
+#> 8, 9, 10, 11, 11, 12, 13, 14, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 1, 2, 3, 4, 5, 6, 7, 8, 9, 9, 1, 2, 3, 4, 5, 6, 7, 11, 12, 12, 13, 14, 15, 16, 17, 1, 2, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 10, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 11, 12, 13, 14, 1, 2, 6, 7, 8, 9, 10, 11, 11, 12, 12, 12, 13, 13, 14, 15, 16, 16, 1, 3, 4, 5, 6, 7, 8, 9, 10, 11, 11, 12, 13, 13, 14, 15, 15, 1, 2, 3, 4, 5, 6, 7, 11, 1, 2, 3, 4, 5, 6, 7, 8, 8, 9, 10, 10, 10, 11, 12, 1, 2, 3, 4, 5, 6,
+#> 7, 8, 9, 10, 1, 2, 3, 4, 5, 6, 6, 7, 8, 8, 9, 10, 11, 12, 13, 14, 15, 15, 16, 17, 17, 1, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 1, 2, 3, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 15, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 1, 2, 3, 6, 7, 8, 9, 10, 10, 11, 12, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 16, 17, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 11, 12, 1, 2, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 1, 2, 3, 4, 5, 6, 7, 8, 9, 1, 2, 3, 4, 4, 5, 6, 7, 8, 9, 10, 10, 11, 11, 12,
+#> 13, 1, 2, 3, 4, 5, 6, 8, 9, 9, 10, 11, 12, 13, 13, 1, 3, 5, 6, 7, 8, 9, 10, 11, 11, 12, 13, 13, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 1, 2, 3, 4, 5, 6, 7, 8, 10, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 16, 19, 1, 2, 3, 5, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 13, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 1, 2, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 22, 22, 23, 1, 6, 7, 8, 9, 10, 11, 11,
+#> 12, 12, 13, 13, 14, 14, 1, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 14, 15, 16, 16, 16, 1, 2, 5, 8, 9, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 1, 3, 4, 5, 6, 6, 7, 8, 1, 2, 3, 4, 4, 5, 6, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 18, 19, 19, 1, 2, 3, 4, 5, 6, 1, 2, 3, 4, 6, 7, 8, 8, 9, 10, 11, 12, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11,
+#> 12, 13, 14, 14, 15, 15, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 12, 13, 13, 14, 15, 16, 17, 18, 19, 1, 2, 3, 4, 4, 5, 6, 7, 8, 9, 10, 11, 11, 12, 12, 12, 1, 2, 3, 4, 5, 6, 8, 1, 2, 3, 4, 5, 5, 6, 7, 7, 7, 9, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 13, 14, 15, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 11, 11, 1, 2, 3, 6, 7, 8, 9, 10, 11, 12, 13, 14, 14, 1, 2, 3, 4, 5, 6, 7, 8, 8, 1, 2, 3, 5, 6, 7, 8, 9, 10, 11, 12, 13,
+#> 14, 14, 15, 17, 1, 2, 3, 4, 5, 6, 7, 8, 1, 2, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 14, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 16, 17, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 22, 1, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 1, 2, 3, 4, 5, 6, 7, 8, 9, 9, 10, 11, 12, 12, 13, 13, 15, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10,
+#> 11, 12, 13, 14, 15, 16, 17, 18, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 19, 20, 21, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 13, 14, 14, 15, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 22, 23, 1, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 14, 15, 15, 16, 16, 17, 18, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 1, 3,
+#> 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 28, 32, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 14, 15, 16, 1, 2, 3, 4, 5, 6, 7, 8, 9, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 10, 11, 12, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 15, 16, 17, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 13, 14, 1, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 13, 1, 2, 3, 4, 5, 5, 6, 7, 8, 9, 10, 11, 11, 11, 12, 1, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 1, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 14, 14, 15, 16, 17,
+#> 18, 1, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 12, 13, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 1, 2, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 1, 2, 3, 4, 5, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 1, 2, 3, 3, 4, 5, 6, 7, 8, 9, 10, 12, 1, 2, 2, 3, 4, 5, 6, 7, 8, 9, 1, 2, 3, 4, 5, 6, 7, 8, 9, 9, 10, 11, 12, 13, 14, 15, 15, 16, 17, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 11, 12, 13, 14, 14, 15, 15, 15, 16, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 16, 1, 2, 3, 4, 5, 6, 7, 8,
+#> 9, 10, 10, 11, 1, 3, 4, 5, 6, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 22, 23, 24, 25, 1, 2, 3, 4, 5, 6, 7, 8, 8, 1, 1, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 18, 19, 20, 21, 22, 1, 2, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 1, 2, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 22, 23, 1, 2, 3, 4, 5, 6, 7, 8,
+#> 9, 10, 11, 12, 13, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 11, 11, 1, 2, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 1, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 1, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 16, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 11, 12, 13, 14, 15, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 15, 16, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 11, 12, 13, 14, 14, 1, 2, 3, 4, 5, 6, 6, 7, 8, 1, 2, 3, 4, 5, 5, 6, 6, 7, 8, 9, 10, 11, 12, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 14, 15,
+#> 16, 17, 18, 19, 20, 21, 1, 2, 3, 4, 5, 7, 8, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 11, 11, 12, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 11, 12, 13, 14, 1, 2, 3, 4, 5, 6, 6, 7, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16,
+#> 17, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 13, 14, 14, 1, 3, 4, 5, 6, 7, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 16, 17, 18, 19, 1, 2, 3, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 14, 1, 2, 3, 5, 6, 7, 8, 9, 1, 2, 3, 5, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 11, 12, 1, 2, 2, 3, 4, 4, 5, 6, 7, 8, 9, 10, 11, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 15, 16, 17, 18, 19, 20, 21, 21, 22, 22, 23, 24, 25,
+#> 1, 2, 3, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 1, 2, 3, 4, 5, 6, 7, 8, 9, 9, 1, 2, 3, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 11, 12, 12, 12, 13, 14, 14, 15, 16, 17, 18, 18, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 1, 2, 3, 4, 5, 5, 6, 6, 8, 8, 1, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 16, 17, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 22, 23, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10,
+#> 11, 11, 13, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 16, 1, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 22, 22, 23, 24, 1, 2, 3, 4, 5, 6, 7, 8, 9, 9, 10, 11, 12, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17,
+#> 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 10, 11, 1, 2, 3, 4, 5, 6, 6, 7, 7, 8, 9, 10, 11, 11, 12, 15, 16, 17, 18, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 1, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 1, 2, 3, 4, 5, 6, 7, 8, 9, 9, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 22, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 13, 14, 15, 16, 17, 17, 18, 1, 2, 3, 4, 5, 6, 7, 8,
+#> 9, 10, 11, 12, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 1, 2, 3, 4, 5, 6, 7, 8, 9, 9, 10, 10, 1, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 1, 2, 3, 4, 5, 6, 7, 7, 8, 8, 1, 2, 3, 4, 5, 6, 7, 8, 1, 2, 3, 4, 5, 6, 7, 8, 9, 1, 2, 3, 4, 5, 6, 6, 7, 7, 7, 8, 8, 1, 2, 3, 4, 5, 6, 7, 7, 8, 9, 10, 11, 12, 12, 13, 13, 14, 14, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 1, 2, 2, 3, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 14, 15, 15, 15,
+#> 16, 16, 17, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 1, 2, 3, 4, 5, 6, 7, 8, 8, 9, 10, 11, 12, 13, 14, 14, 15, 15, 1, 2, 3, 6, 9, 10, 11, 12, 12, 13, 14, 15, 16, 16, 16, 17, 18, 1, 2, 3, 4, 5, 6, 6, 7, 8, 9, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 14, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 1, 2, 4, 5, 6, 7, 8, 8, 9, 10, 11, 12, 12,
+#> 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 14, 15, 16, 16, 17, 1, 2, 3, 4, 5, 6, 6, 7, 8, 9, 9, 10, 11, 11, 1, 2, 3, 4, 5, 6, 7, 8, 9, 9, 10, 11, 12, 13, 13, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 22, 23, 1, 2, 3, 4, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 15, 16, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 14, 14, 1, 2, 3, 4, 5, 6, 7,
+#> 8, 9, 10, 11, 12, 13, 14, 15, 16, 16, 17, 1, 2, 3, 4, 5, 6, 7, 8, 9, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 20, 1, 2, 3, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 14, 15, 16, 16, 17, 17, 18, 19, 20, 21, 22, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 15, 1, 2, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 1, 2, 3, 1, 2, 3, 4, 5, 6,
+#> 7, 8, 9, 10, 11, 12, 13, 14, 16, 17, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 10, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 11, 12, 13, 14, 15, 16, 17, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 11, 12, 12, 13, 13, 14, 1, 3, 4, 5, 6, 7, 8, 9, 10, 10, 11, 12, 12, 13, 14, 15, 16, 17, 17, 1, 2, 3, 4, 4, 5, 5, 5, 6, 7, 7, 8, 9, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 15,
+#> 16, 16, 16, 17, 18, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 14, 15, 16, 1, 2, 3, 4, 4, 5, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 1, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 13, 14, 14, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 1, 2, 3, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 1, 5, 6, 7, 8, 9, 10,
+#> 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 1, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 22, 22, 22, 23, 23, 24, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 13, 14, 14, 15, 1, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 11, 12, 12, 13, 1, 2, 3, 4, 5, 6, 6, 7, 8, 9, 1, 2, 3, 4,
+#> 5, 6, 7, 8, 9, 9, 10, 11, 12, 1, 2, 3, 4, 5, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 17, 1, 2, 3, 4, 5, 6, 6, 7, 8, 9, 10, 11, 12, 13, 14, 14, 15, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 11, 13, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 11, 1, 2, 3, 4, 6, 7, 8, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 1, 2, 3, 4, 5, 6, 7, 8, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 13, 14, 15, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 1, 2, 3, 4, 5, 6, 8, 9, 10, 11, 12, 13, 13,
+#> 15, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 17, 18, 1, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 11, 12, 13, 14, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 16, 17, 20, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 1, 2, 3, 4, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 18, 1, 2, 3, 4, 5, 6, 7, 7, 8, 1, 2, 3, 4, 5, 6, 7, 8, 9, 9, 10, 11, 12, 13, 14, 15, 16, 1, 2, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 15, 16, 17, 18,
+#> 19, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 1, 2, 3, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 1, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 1, 3, 3, 5, 7, 8, 9, 10, 10, 11, 11, 12, 13, 13, 1, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 16, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 22, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14,
+#> 14, 15, 16, 17, 18, 19, 19, 20, 21, 22, 22, 1, 2, 3, 4, 5, 6, 7, 8, 1, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 22, 23, 24, 25, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 15, 15, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 16, 17, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 16, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 1, 3, 4, 5, 7, 8, 9, 9, 10, 10, 10, 1, 2, 3, 4, 5, 6, 7, 7, 8, 9,
+#> 10, 11, 12, 13, 14, 14, 14, 15, 16, 17, 18, 19, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 14, 15, 16, 16, 1, 2, 3, 4, 5, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 14, 15, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 16, 17, 18, 20, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 1, 3, 4, 5, 6, 7, 8, 9, 10, 10, 11, 12, 13, 14, 15, 16, 16, 17, 17, 18, 1, 2, 3, 4, 5, 6, 7, 8, 9, 9, 10, 11, 1, 2, 3, 4, 5, 6, 8, 9, 10, 11, 12, 13, 14, 15, 16, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13,
+#> 14, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 16, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 15, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 12, 13, 14, 14, 15, 1, 2, 3, 4, 5, 6, 7, 8, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 1, 3, 4, 5, 6, 7, 8, 9, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 1, 3, 4, 4, 5, 6, 7, 8, 9, 10, 10, 11, 11, 12, 13, 14, 15, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14,
+#> 15, 16, 17, 18, 19, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 1, 2, 3, 4, 5, 6, 7, 7, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 1, 2, 3, 4, 5, 6, 6, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 5, 5, 6, 7, 8, 9, 10, 11, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 1, 2, 3, 4,
+#> 5, 6, 7, 8, 9, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 17, 18, 1, 2, 3, 4, 5, 6, 7, 7, 8, 9, 10, 11, 12, 13, 13, 14, 15, 15, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 15, 16, 17, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 1, 2, 3, 4, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 1, 2, 3, 4, 5, 6, 7, 9, 10, 11, 11, 1, 2, 3, 4,
+#> 5, 6, 7, 8, 9, 10, 10, 11, 12, 13, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 22, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 1, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 17, 18, 18, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 19, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15,
+#> 16, 17, 18, 18, 20, 21, 22, 23, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 1, 2, 3, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 18, 1, 2, 3, 4, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 14, 15, 16, 17, 17, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 15, 16, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 1, 2, 3, 4, 5, 6, 7, 8, 9, 9, 10, 11, 12, 13, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 14, 15, 16, 17, 18, 19, 20, 20, 21, 22, 23, 23, 24, 25, 26, 27, 1, 2, 3,
+#> 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 17, 18, 19, 20, 20, 21, 22, 23, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 1, 2, 3, 4, 4, 5, 5, 6, 7, 8, 1, 2, 3, 4, 5, 1, 2, 3, 4, 4, 5, 1, 2, 2, 3, 4, 5, 6, 7, 8, 9, 10, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 1, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 13, 14, 15, 16, 17, 18, 19, 20, 21, 21, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 10, 11, 12, 13,
+#> 14, 15, 1, 5, 6, 7, 8, 9, 10, 10, 11, 11, 12, 13, 14, 14, 15, 15, 16, 16, 17, 17, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 14, 15, 16, 16, 17, 18, 18, 19, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 1, 2, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 17, 18, 1, 2, 3, 4, 5, 6, 7, 7, 8, 9, 10, 11, 12, 13, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11,
+#> 12, 13, 14, 15, 16, 17, 18, 19, 20, 20, 21, 21, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 16, 17, 18, 1, 2, 3, 4, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 1, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 22, 23, 24, 25, 26, 27, 28, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 13, 14, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 10, 12, 13, 14,
+#> 15, 16, 16, 17, 18, 19, 20, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 16, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 10, 11, 12, 13, 14, 15, 16, 17, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 13, 14, 15, 15, 16, 1, 2, 3, 4, 5, 6, 7, 7, 8, 9, 11, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 22, 23, 24, 24, 24, 1, 2, 3, 4, 5, 6,
+#> 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 1, 2, 3, 4, 5, 6, 7, 8, 9, 11, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 17, 18, 19, 20, 21, 22, 23, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 13, 14, 15, 16, 17, 18, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 13, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11,
+#> 12, 13, 14, 14, 15, 16, 17, 17, 18, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 11, 12, 13, 14, 15, 16, 17, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 18, 18, 19, 20, 21, 22, 23, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 18, 19, 1, 2, 3, 4, 4, 5, 6, 7, 9, 10, 11, 12, 13, 14, 15, 1, 2, 3, 4, 5, 6, 7, 8, 9, 9, 10, 11, 11, 12, 13, 1, 2, 3, 4, 5, 6, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 1, 3, 4, 5, 6, 7, 8, 9,
+#> 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 1, 2, 2, 3, 4, 5, 6, 7, 8, 8, 9, 10, 10, 11, 12, 13, 1, 2, 3, 4, 5, 6, 7, 7, 7, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 1, 2, 3, 4, 5, 6, 7, 8, 9, 9, 10, 11, 11, 12, 1, 2, 3, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 19, 20, 21, 21, 22, 1, 2, 3, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 1, 2, 3, 4, 5, 6, 7, 8, 9,
+#> 10, 11, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 1, 2, 3, 4, 5, 6, 7, 8, 9, 16, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 1, 2, 3, 3, 4, 5, 6, 7, 8, 8, 9, 10, 11, 11, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 10, 11, 12, 1, 2, 3, 1, 2, 3, 4, 6, 6, 8, 12, 13, 14, 15, 16, 17, 1, 2, 3,
+#> 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 16, 17, 18, 19, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 1, 2, 3, 4, 5, 6, 7, 8, 8, 9, 10, 11, 12, 13, 14, 15, 15, 16, 17, 18, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 15, 16, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 1, 2, 2, 3, 4, 4, 5, 6, 7, 8, 9, 10, 12, 13, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 11, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 14, 15, 16,
+#> 17, 18, 18, 1, 3, 4, 5, 6, 7, 8, 9, 10, 11, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 11, 12, 13, 14, 15, 15, 16, 17, 18, 19, 19, 20, 21, 22, 22, 23, 24, 25, 1, 2, 3, 4, 5, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 1, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 16, 17, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 11, 12, 13, 14, 15, 1, 2, 3, 4, 5, 6, 7,
+#> 8, 9, 10, 11, 12, 13, 14, 15, 1, 2, 3, 4, 5, 6, 7, 8, 9, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 15, 16, 17, 18, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 1, 2, 3, 4, 5, 6, 7, 8, 9, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 15, 1, 2, 3, 4, 5, 6, 7, 8, 9, 9, 10, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 10, 11, 12, 13, 14, 15, 15, 1, 2, 3, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 1, 2, 3, 4, 6, 7,
+#> 8, 9, 10, 11, 11, 12, 13, 14, 14, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 20, 1, 2, 3, 4, 5, 6, 7, 8, 8, 9, 10, 11, 12, 13, 14, 15, 16, 16, 17, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 1, 2, 3, 4, 5, 6, 7, 8, 9, 9, 10, 11, 12, 13, 14, 1, 2, 3, 4, 5, 6, 7, 8, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 22, 23, 24, 1, 2, 3, 4, 5, 6, 7, 8, 1, 2, 3, 4, 5, 6, 7, 8, 9, 9, 10, 11, 12, 13, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 16, 17, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12,
+#> 13, 14, 15, 16, 17, 18, 18, 1, 2, 3, 4, 5, 6, 7, 8, 9, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 1, 4, 5, 6, 7, 8, 9, 10, 11, 11, 12, 13, 14, 15, 1, 3, 4, 5, 6, 7, 8, 9, 9, 9, 10, 11, 1, 2, 3, 4, 5, 5, 6, 7, 8, 9, 9, 10, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 7, 8, 9, 10, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13,
+#> 14, 15, 16, 17, 18, 19, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 5, 5, 6, 7, 8, 9, 10, 11, 12, 12, 13, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 23, 23, 24, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 11, 12, 13, 14, 14, 15, 16, 17, 17, 18, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 1, 2, 3, 4, 5, 6, 7, 7, 8, 9, 10, 11, 12, 13, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 1, 2, 3, 4, 5, 6, 6, 7, 8, 9, 10, 11, 12,
+#> 13, 1, 2, 3, 4, 5, 6, 7, 8, 9, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 13, 14, 15, 16, 17, 17, 17, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 1, 2, 3, 4, 4, 5, 6, 7, 8, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 12, 14, 15, 16, 18, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 11, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 17, 1, 2, 3, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13,
+#> 14, 14, 15, 16, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 14, 15, 16, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 11, 12, 13, 1, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 10, 11, 11, 12, 13, 14, 15, 16, 17, 18, 18, 19, 20, 20, 21, 21, 22, 1, 2, 3, 4, 5, 6, 7, 8, 8, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 10, 11, 12, 12, 13, 13, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11,
+#> 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 22, 23, 24, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 13, 14, 15, 16, 17, 18, 18, 19, 20, 1, 2, 3, 4, 5, 6, 7, 8, 9, 9, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 11, 12, 13, 15, 16, 17, 19, 19, 1, 2, 3, 4, 5, 6, 7, 8, 8, 9, 10, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 12, 13, 1, 2, 3, 4, 5, 8, 9, 10, 11, 12, 13, 1, 2, 3, 4, 5, 6, 7, 8, 8, 9, 10, 11, 12, 13, 14, 15, 16, 16, 17, 1,
+#> 2, 3, 4, 5, 6, 7, 8, 9, 10, 1, 2, 3, 4, 5, 5, 6, 7, 8, 9, 9, 13, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 11, 12, 13, 1, 2, 3, 4, 5, 6, 7, 9, 10, 1, 2, 3, 4, 5, 6, 7, 8, 8, 9, 10, 11, 12, 13, 14, 15, 1, 2, 3, 4, 5, 6, 7, 8, 9, 9, 10, 11, 13, 14, 15, 1, 2, 3, 4, 5, 6, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 13, 14, 15, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 10, 11, 13, 14, 15, 16, 17, 18, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12,
+#> 13, 14, 15, 16, 17, 18, 19, 20, 21, 1, 2, 3, 4, 5, 5, 6, 7, 8, 9, 10, 11, 12, 12, 13, 14, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 12, 13, 14, 15, 16, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 1, 2, 3, 4, 5, 6, 6, 7, 8, 9, 10, 11, 11, 1, 2, 3, 4, 5, 6, 7, 7, 8, 9, 10, 10, 11, 12, 13, 13, 14, 15, 16, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 1, 2, 3, 4, 5, 6, 6, 7, 7, 8, 9, 10, 11, 12, 13, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20,
+#> 21, 22, 23, 24, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 13, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 20, 21, 22, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 1, 2, 3, 4, 5, 6, 7, 8, 8, 9, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11,
+#> 12, 13, 15, 16, 16, 18, 20, 21, 22, 23, 24, 25, 26, 26, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 16, 17, 17, 18, 19, 20, 1, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 10, 11, 12, 13, 13, 14, 15, 16, 1, 3, 4, 5, 6, 7, 8, 9, 9, 10, 11, 12, 12, 13, 14, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 1, 2, 3, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 1, 4, 5, 6, 6, 7, 8, 8, 9, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11,
+#> 12, 13, 14, 15, 15, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 10, 11, 12, 13, 14, 15, 15, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 5, 6, 8, 9, 1, 2, 4, 5, 6, 7, 8, 8, 9, 10, 11, 12, 13, 13, 14, 14, 15, 18, 1, 2, 3, 4, 5, 6, 7, 8, 9, 9, 9, 10, 11, 12, 13, 1, 2, 3, 4, 5, 6, 6, 7, 8, 1, 3, 4, 4, 5, 6, 7, 8, 9, 10, 11, 13, 13, 14, 15, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 10, 11, 12, 12, 13, 14, 1, 2, 3, 4, 5, 6, 7, 8, 8, 9, 9, 10, 10, 11, 12, 13, 14, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 1, 2, 3, 4, 5, 6, 7, 8, 8,
+#> 9, 10, 11, 12, 13, 14, 15, 16, 16, 17, 18, 19, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 1, 2, 3, 4, 5, 6, 7, 7, 8, 9, 10, 10, 11, 11, 12, 12, 13, 15, 16, 17, 18, 18, 19, 20, 21, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 17, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 13, 14, 14, 15, 15, 16, 17, 18, 1, 2, 3, 4, 5, 6, 6, 7, 8, 9, 9, 10, 11, 11, 12, 1, 2, 3, 4,
+#> 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 15, 16, 17, 18, 19, 19, 20, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 12, 13, 14, 15, 16, 17, 18, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 20, 21, 22, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 22, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21,
+#> 21, 22, 23, 23, 1, 2, 3, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 5, 6, 8, 8, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 14, 1, 2, 3, 4, 5, 6, 7, 8, 8, 9, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 12, 13, 14, 1, 2, 3, 4, 6, 7, 8, 9, 10, 11, 12, 12, 13, 14, 14, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 18, 19, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 22, 1, 2, 3,
+#> 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 16, 17, 17, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 15, 16, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 14, 1, 2, 3, 4, 5, 6, 7, 8, 9, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 19, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13,
+#> 14, 15, 16, 16, 1, 2, 3, 4, 5, 6, 7, 9, 10, 11, 12, 13, 14, 14, 15, 15, 16, 17, 1, 2, 3, 4, 5, 6, 7, 7, 8, 10, 11, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 18, 19, 19, 20, 21, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 1, 2, 3, 4, 5, 6, 7, 8, 9, 9, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 16, 17, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 14, 15, 16, 17, 18, 19, 20, 21, 22, 22, 1, 2, 3, 4, 5, 6, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 1, 2, 3, 4,
+#> 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 1, 2, 3, 4, 5, 6, 6, 7, 8, 9, 10, 11, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 22, 1, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 15, 1, 2, 3, 4, 5, 5, 1, 2, 3, 4, 5, 6, 7, 8, 9, 9, 10, 11, 12, 1, 2, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 1, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 15, 16, 17, 17, 18, 19, 1, 2, 3, 4, 5, 6, 7, 8, 8, 9, 9, 9, 10, 11,
+#> 12, 12, 14, 15, 16, 17, 17, 18, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 12, 13, 13, 14, 15, 16, 17, 17, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 22, 23, 24, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 10, 11, 12, 13, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 16, 17, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 13,
+#> 14, 15, 16, 17, 18, 19, 20, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 15, 1, 2, 3, 4, 5, 6, 7, 7, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 1, 2, 3, 4, 5, 6, 7, 7, 8, 9, 10, 10, 13, 14, 15, 16, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 12, 13, 13, 14, 15, 15, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 5, 5, 6, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 7, 8, 9, 10, 10, 11, 12, 13, 14, 15, 16, 18, 1, 2, 3, 4, 5, 6, 6, 7, 8, 8, 9, 10, 11, 12, 13, 1, 2, 3,
+#> 4, 5, 6, 7, 8, 9, 9, 10, 11, 13, 14, 1, 2, 3, 4, 5, 6, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 10, 11, 11, 12, 12, 13, 1, 1, 3, 4, 5, 6, 7, 8, 9, 11, 12, 13, 14, 15, 16, 17, 18, 19, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 11, 12, 13, 14, 15, 1, 2, 3, 4, 5, 6, 7, 8, 9, 9, 10, 11, 11, 12, 13, 14, 1, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 14, 15, 16, 17, 17, 18, 18, 1, 2, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 22, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 17, 1, 2,
+#> 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 15, 1, 2, 3, 4, 5, 5, 6, 7, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 16, 17, 18, 19, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 12, 13, 1, 4, 5, 6, 6, 7, 8, 9, 10, 11, 12, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 21, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 1, 2, 3, 4, 5, 6, 7, 8, 9, 1, 2, 3, 4, 4, 5, 6, 7, 8, 9, 10, 11, 14, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 16, 17, 18, 18, 19, 1, 2, 3, 4, 5, 6, 7, 8, 9,
+#> 10, 11, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 11, 12, 13, 14, 15, 16, 16, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 13, 14, 1, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 19, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 19, 20, 21, 21, 22, 22, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 16, 18, 18, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 1, 2, 3, 4, 5, 6, 7, 8, 8, 9, 10, 11, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16,
+#> 17, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 15, 16, 17, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 1, 2, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 15, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 1, 2, 3, 4, 5, 6, 6, 7, 8, 8, 9, 10, 11, 11, 12, 12, 1, 2, 3, 4, 5,
+#> 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 22, 1, 2, 3, 4, 5, 6, 6, 7, 8, 9, 10, 11, 12, 12, 13, 14, 15, 15, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 18, 19, 1, 2, 3, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 19, 1, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 1, 2, 3, 4, 5, 6, 7, 8, 9, 1, 2, 3, 4, 4,
+#> 5, 6, 7, 8, 9, 10, 11, 11, 12, 13, 13, 14, 14, 15, 16, 17, 17, 1, 2, 3, 4, 5, 6, 6, 7, 8, 9, 9, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 9, 10, 11, 12, 13, 14, 1, 2, 3, 4, 5, 6, 7, 7, 8, 9, 10, 11, 12, 13, 14, 14, 15, 16, 17, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 1, 2, 3, 4, 5, 6, 6, 7, 8, 9, 10, 10, 11, 12, 13, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 1, 2, 3, 4, 5, 6, 7, 8, 9, 9, 10, 11, 12, 13, 14, 15, 16, 17,
+#> 18, 19, 20, 20, 21, 21, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 14, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 10, 11, 12, 12, 13, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 14, 15, 15, 16, 17, 18, 19, 20, 21, 22, 1, 2, 3, 4, 5, 6, 7, 8, 8, 9, 1, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 13, 14, 15, 1, 2, 3, 4, 5, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 1, 3, 4, 5, 6, 7, 8, 9, 9, 10, 11, 12, 13, 14, 15, 1, 2, 3,
+#> 4, 5, 6, 7, 8, 8, 9, 10, 11, 12, 13, 14, 15, 1, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 1, 2, 3, 4, 5, 7, 8, 9, 9, 10, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 14, 15, 1, 2, 3, 4, 5, 6, 7, 8, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 10, 11, 12, 1, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 15, 16, 1, 2, 3, 4, 5, 6, 7, 7, 8,
+#> 9, 10, 11, 12, 13, 14, 14, 15, 16, 17, 18, 1, 2, 3, 4, 5, 5, 6, 7, 8, 8, 9, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 16, 17, 18, 1, 2, 3, 4, 5, 6, 8, 9, 10, 11, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 21, 22, 23, 24, 25, 27, 1, 2, 3, 4, 5, 6, 7, 8, 8, 9, 10, 11, 12, 13, 1, 2, 3, 4, 5, 6, 7, 7, 8, 9, 9, 10, 11, 11, 1, 2, 3, 4, 5, 6, 7, 8,
+#> 9, 10, 11, 11, 12, 13, 15, 1, 2, 3, 4, 5, 6, 6, 7, 8, 9, 10, 11, 12, 13, 14, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 1, 2, 3, 4, 5, 6, 6, 7, 8, 9, 9, 10, 11, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 15, 16, 17, 18, 19, 20, 1, 1, 2, 3, 4, 5, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 1, 2, 3, 4,
+#> 5, 6, 7, 8, 9, 9, 10, 11, 11, 12, 12, 13, 14, 15, 16, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 1, 2, 3, 4, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 12, 13, 15, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 1, 2, 3, 4, 5, 6, 7, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13,
+#> 14, 15, 16, 17, 17, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 12, 13, 14, 15, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 1, 2, 3, 4, 5, 6, 7, 8, 8, 9, 10, 11, 12, 13, 13, 14, 15, 15, 1, 3, 3, 4, 5, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 10, 10, 11, 12, 13, 14, 14, 15, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 1, 2, 3, 4, 5, 6,
+#> 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 10, 11, 12, 13, 14, 15, 1, 2, 3, 4, 5, 6, 7, 8, 9, 1, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 1, 3, 4, 5, 6, 7, 7, 8, 9, 9, 10, 11, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 16, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 13, 1, 2, 2, 3, 4, 5, 6, 7, 8, 9, 10, 10, 11, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 14, 15, 17, 1, 2, 3, 4, 5, 6, 6, 1, 2, 3, 4, 5, 5, 6, 7, 8, 8,
+#> 9, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 15, 16, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 1, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 16, 17, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 12, 13, 14, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 1, 2, 3, 4, 5, 6, 7, 8, 9, 9, 10, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 14, 15, 15, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 12, 13, 14, 15, 1, 1, 2, 3, 4, 5, 6,
+#> 7, 8, 9, 9, 9, 10, 11, 12, 1, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 9, 1, 2, 3, 4, 5, 6, 7, 8, 8, 9, 1, 2, 3, 4, 5, 6, 7, 7, 8, 9, 10, 11, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 1, 2, 3, 4, 5, 6, 7, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 10, 11, 12, 13, 14, 14, 16, 17, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 13, 1, 2, 3, 4, 5,
+#> 6, 6, 7, 7, 8, 9, 10, 11, 12, 12, 13, 1, 2, 3, 4, 5, 6, 7, 8, 8, 1, 1, 2, 3, 4, 5, 6, 6, 7, 8, 9, 10, 11, 1, 2, 3, 4, 5, 5, 6, 6, 7, 8, 9, 10, 11, 12, 13, 1, 2, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 1, 2, 3, 4, 5, 6, 7, 8, 8, 9, 10, 12, 13, 14, 1, 2, 3, 4, 5, 6, 7, 8, 8, 9, 10, 11, 12, 13, 14, 15, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 1, 2, 3, 4, 5, 6, 7, 8, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 11, 12, 13, 14, 15, 16, 17, 17, 19, 1, 2, 3, 4, 5, 6, 7, 8, 9, 9, 10, 11, 11,
+#> 12, 1, 2, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 1, 2, 2, 3, 4, 5, 6, 7, 7, 8, 9, 10, 11, 12, 13, 15, 1, 2, 4, 5, 6, 7, 8, 9, 10, 11, 13, 14, 15, 16, 17, 1, 2, 3, 4, 5, 6, 6, 7, 8, 9, 10, 11, 12, 13, 15, 16, 17, 18, 19, 1, 2, 3, 4, 5, 6, 8, 9, 10, 11, 12, 13, 14, 15, 16, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 11, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 10, 11, 12, 13, 1, 2, 3, 4, 5, 6, 8, 1,
+#> 2, 3, 4, 5, 6, 7, 8, 9, 10, 10, 11, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 1, 3, 4, 5, 6, 7, 8, 8, 9, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 1, 2, 3, 4, 5, 6, 7, 8, 8, 9, 10, 11, 12, 13, 14, 14, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 12, 13, 13, 14, 16, 1, 2, 3, 4, 5, 6, 6, 7, 8, 8, 9, 9, 10, 10, 11, 11, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12,
+#> 13, 14, 14, 1, 2, 3, 4, 5, 6, 7, 7, 8, 9, 10, 11, 11, 1, 2, 3, 4, 5, 5, 6, 7, 8, 8, 9, 10, 11, 12, 13, 14, 15, 16, 1, 2, 3, 4, 5, 6, 7, 8, 8, 9, 10, 1, 2, 3, 1, 2, 3, 4, 5, 6, 7, 8, 9, 9, 10, 10, 1, 2, 3, 4, 5, 6, 7, 1, 2, 3, 4, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 16, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 11, 12, 13, 1, 2, 3, 4, 4, 5, 6, 7, 8, 9, 9, 10, 11, 12, 13, 14, 15, 16, 16, 18, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 10, 11, 12, 12, 13, 14, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 1, 2, 3, 4, 5, 6, 7, 8,
+#> 8, 9, 10, 11, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 13, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 1, 2, 3, 4, 5, 6, 6, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 13, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 12, 13, 14, 15, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 11, 1, 2, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12,
+#> 13, 13, 14, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 1, 2, 3, 4, 5, 6, 7, 8, 8, 9, 10, 11, 12, 13, 14, 15, 1, 2, 3, 4, 5, 6, 7, 8, 8, 9, 10, 11, 12, 12, 13, 13, 14, 1, 2, 3, 4, 5, 6, 7, 8, 9, 9, 10, 1, 2, 3, 4, 5, 6, 7, 8, 11, 11, 12, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 1, 2, 3, 4, 5, 5, 6, 6, 7, 8, 9, 9, 10, 11, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 16, 1,
+#> 2, 3, 4, 5, 6, 7, 7, 8, 9, 10, 10, 11, 12, 12, 13, 14, 15, 16, 17, 18, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 1, 2, 3, 4, 5, 6, 7, 8, 9, 1, 2, 2, 3, 4, 5, 6, 1, 2, 3, 3, 4, 7, 8, 9, 10, 11, 11, 12, 13, 14, 1, 2, 3, 4, 5, 6, 7, 8, 8, 9, 10, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 10, 1, 2, 3, 4, 5, 6, 7, 8, 8, 9, 9, 10, 11, 12, 13, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 1, 2, 3, 4, 5, 6, 7, 8, 9, 1, 2, 3, 4, 5, 6, 7, 8, 9, 9, 10, 11, 12, 1,
+#> 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 5, 5, 6, 7, 8, 8, 9, 10, 1, 3, 4, 5, 6, 7, 8, 9, 10, 10, 11, 12, 13, 13, 1, 2, 3, 4, 5, 6, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 18, 1, 2, 3, 4, 5, 6, 7, 8, 9, 9, 10, 1, 2, 3, 4, 5, 6, 7, 8, 1, 2, 3, 4, 5, 6, 7, 8, 8, 9, 10, 10, 11, 1, 2, 3, 4, 5, 6, 7, 7, 8, 9, 10, 10, 11, 12, 13, 1, 2, 3, 4, 5, 6, 7, 8, 9, 1, 2, 3, 4, 5, 6, 7, 8, 9, 1, 2, 2, 3, 4, 6, 7, 8, 9, 9, 10, 10, 11, 12, 13, 1, 2, 3,
+#> 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 1, 2, 3, 4, 5, 6, 7, 7, 8, 9, 10, 11, 1, 2, 1, 2, 3, 4, 5, 6, 7, 8, 9, 9, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 1, 2, 3, 4, 5, 6, 6, 7, 8, 9, 10, 10, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 1, 2, 3, 4, 5, 6, 8, 9, 10, 11, 1, 2, 3, 4, 5, 6, 7, 7, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 1, 2, 3, 4, 5, 7, 1, 2, 3, 4, 5, 6, 7, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 1, 2, 3, 4, 5, 6, 7, 8, 9,
+#> 10, 1, 3, 4, 5, 6, 7, 8, 8, 9, 10, 11, 12, 13, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 1, 2, 4, 5, 6, 7, 8, 8, 9, 10, 11, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 1, 2, 3, 4, 5, 6, 7, 8, 9, 11, 1, 2, 3, 4, 5, 6, 7, 8, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 10, 1, 1, 1, 1, 2, 3, 4, 5, 5, 6, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 1, 3, 4, 4, 4, 5, 6, 7, 8, 8, 9, 10, 11, 12, 13, 1, 2, 4, 5, 6, 7, 8, 9, 10,
+#> 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 1, 2, 3, 4, 5, 6, 7, 7, 1, 2, 3, 4, 5, 6, 7, 1, 2, 3, 4, 5, 6, 7, 8, 1, 2, 3, 4, 5, 6, 7, 8, 9, 9, 10, 1, 2, 3, 4, 5, 6, 7, 8, 9, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 1, 2, 3, 4, 5, 6, 7, 1, 2, 3, 4, 5, 6, 7, 8, 9, 1, 2, 3, 4, 5, 6, 7, 8, 1, 2, 3, 4, 5, 6, 7, 1, 2, 3, 4, 5, 6, 7, 8, 9, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 1, 2, 3, 4, 5, 6, 6, 7, 7, 1, 2, 3, 4, 5, 6, 7, 8, 9, 1, 2, 3, 4, 5,
+#> 5, 6, 6, 7, 1, 2, 3, 4, 5, 6, 1, 2, 3, 4, 5, 6, 1, 2, 3, 4, 5, 6, 7, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 8, 9, 1, 2, 3, 4, 5, 6, 7, 8, 9, 1, 2, 2, 3, 4, 6, 7, 1, 2, 3, 4, 5, 6, 6, 7, 8, 8, 9, 10, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 1, 2, 3, 4, 5, 6, 7, 8, 1, 3, 4, 5, 6, 8, 9, 10, 11, 12, 13, 14, 15, 1, 2, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 14, 1, 2, 3, 4, 5, 6, 7, 7, 8, 8, 1, 2, 3, 4, 5, 6, 7, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 1, 2, 3, 4, 5, 6, 6, 6, 7, 8, 9, 10, 11,
+#> 12, 1, 2, 3, 4, 5, 5, 6, 6, 1, 2, 3, 4, 5, 6, 7, 8, 8, 9, 1, 2, 3, 4, 5, 6, 7, 1, 2, 3, 4, 5, 6, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 11, 12, 13, 1, 2, 3, 4, 5, 1, 2, 3, 4, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 17, 18, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 11, 1, 2, 1, 2, 3, 4, 5, 6, 7, 8, 1, 2, 3, 4, 5, 6, 1, 2, 3, 4, 5, 6, 7, 1, 2, 3, 3, 4, 5, 6, 7, 1, 2, 3, 4, 5, 6, 7, 8, 1, 2, 3, 4, 5, 1, 2, 3, 4, 1, 2, 3, 4, 5, 1, 2, 3, 4, 5, 1, 2, 3, 1, 2, 3, 4, 5, 6, 7, 8, 9, 9, 1, 2, 3, 4,
+#> 1, 2, 3, 1, 2, 3, 1, 2, 3, 1, 2, 3, 4, 4, 5, 6, 7, 8, 1, 2, 3, 4, 5, 1, 2, 3, 4, 5, 6, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 1, 2, 3, 4, 5, 6, 1, 2, 3, 4, 5, 1, 2, 3, 4, 5, 6, 7, 8, 9, 11, 12, 1, 2, 3, 4, 5, 5, 7, 8, 8, 1, 2, 3, 4, 5, 1, 2, 3, 4, 5, 1, 2, 3, 4, 1, 2, 3, 4, 5, 1, 2, 3, 1, 2, 3, 1, 2, 3, 4, 5, 6, 1, 2, 3, 4, 5, 6, 7, 1, 2, 1, 2, 1, 2, 3, 4, 5, 1, 2, 3, 4, 1, 2, 3, 4, 5, 6, 7, 1, 2, 3, 4, 5, 6, 7, 1, 2, 3, 1, 2, 3, 4, 5, 6, 7, 8, 1, 2, 4, 1, 2, 3, 4, 4, 5, 6, 1, 2, 3, 1,
+#> 2, 3, 3, 4, 4, 1, 2, 3, 4, 1, 2, 3, 4, 5, 1, 2, 3, 4, 1, 2, 3, 4, 1, 2, 3, 4, 5, 1, 3, 4, 5, 6, 1, 2, 4, 5, 6, 7, 8, 1, 1, 1, 2, 3, 4, 5, 7, 8, 9, 9, 10, 1, 2, 3, 4, 5, 1, 2, 3)]
+#> Groups: playerID [1,322]
+#>
+#> playerID yearID teamID G AB R H career_year
+#> <chr> <int> <fctr> <int> <int> <int> <int> <dbl>
+#> 1 bondto01 1874 BR2 55 245 25 54 1
+#> 2 bondto01 1875 HR1 72 289 32 77 2
+#> 3 bondto01 1876 HAR 45 182 18 50 3
+#> 4 bondto01 1877 BSN 61 259 32 59 4
+#> # ... with 19,109 more rows
Or, as in the introductory example, we could compute a z-score:
+mutate(players, G_z = (G - mean(G)) / sd(G))
+#> Source: local data frame [c("bondto01", "bondto01", "bondto01", "bondto01", "bondto01", "bondto01", "bondto01", "bondto01", "bondto01", "bondto01", "bondto01", "hinespa01", "hinespa01", "hinespa01", "hinespa01", "hinespa01", "hinespa01", "hinespa01", "hinespa01", "hinespa01", "hinespa01", "hinespa01", "hinespa01", "hinespa01", "hinespa01", "hinespa01", "hinespa01", "hinespa01", "hinespa01", "hinespa01", "hinespa01", "hinespa01", "heckegu01", "heckegu01", "heckegu01", "heckegu01", "heckegu01", "heckegu01", "heckegu01", "heckegu01",
+#> "heckegu01", "radboch01", "radboch01", "radboch01", "radboch01", "radboch01", "radboch01", "radboch01", "radboch01", "radboch01", "radboch01", "radboch01", "radboch01", "oneilti01", "oneilti01", "oneilti01", "oneilti01", "oneilti01", "oneilti01", "oneilti01", "oneilti01", "oneilti01", "oneilti01", "keefeti01", "keefeti01", "keefeti01", "keefeti01", "keefeti01", "keefeti01", "keefeti01", "keefeti01", "keefeti01", "keefeti01", "keefeti01", "keefeti01", "keefeti01", "keefeti01", "keefeti01", "clarkjo01",
+#> "clarkjo01", "clarkjo01", "clarkjo01", "clarkjo01", "clarkjo01", "clarkjo01", "clarkjo01", "clarkjo01", "clarkjo01", "clarkjo01", "clarkjo01", "clarkjo01", "rusieam01", "rusieam01", "rusieam01", "rusieam01", "rusieam01", "rusieam01", "rusieam01", "rusieam01", "rusieam01", "rusieam01", "duffyhu01", "duffyhu01", "duffyhu01", "duffyhu01", "duffyhu01", "duffyhu01", "duffyhu01", "duffyhu01", "duffyhu01", "duffyhu01", "duffyhu01", "duffyhu01", "duffyhu01", "duffyhu01", "duffyhu01", "duffyhu01", "duffyhu01",
+#> "youngcy01", "youngcy01", "youngcy01", "youngcy01", "youngcy01", "youngcy01", "youngcy01", "youngcy01", "youngcy01", "youngcy01", "youngcy01", "youngcy01", "youngcy01", "youngcy01", "youngcy01", "youngcy01", "youngcy01", "youngcy01", "youngcy01", "youngcy01", "youngcy01", "youngcy01", "youngcy01", "lajoina01", "lajoina01", "lajoina01", "lajoina01", "lajoina01", "lajoina01", "lajoina01", "lajoina01", "lajoina01", "lajoina01", "lajoina01", "lajoina01", "lajoina01", "lajoina01", "lajoina01", "lajoina01",
+#> "lajoina01", "lajoina01", "lajoina01", "lajoina01", "lajoina01", "lajoina01", "wadderu01", "wadderu01", "wadderu01", "wadderu01", "wadderu01", "wadderu01", "wadderu01", "wadderu01", "wadderu01", "wadderu01", "wadderu01", "wadderu01", "wadderu01", "wadderu01", "mathech01", "mathech01", "mathech01", "mathech01", "mathech01", "mathech01", "mathech01", "mathech01", "mathech01", "mathech01", "mathech01", "mathech01", "mathech01", "mathech01", "mathech01", "mathech01", "mathech01", "mathech01", "chaseha01",
+#> "chaseha01", "chaseha01", "chaseha01", "chaseha01", "chaseha01", "chaseha01", "chaseha01", "chaseha01", "chaseha01", "chaseha01", "chaseha01", "chaseha01", "chaseha01", "chaseha01", "chaseha01", "chaseha01", "lordha01", "lordha01", "lordha01", "lordha01", "lordha01", "lordha01", "lordha01", "lordha01", "lordha01", "lordha01", "crigelo01", "crigelo01", "crigelo01", "crigelo01", "crigelo01", "crigelo01", "crigelo01", "crigelo01", "crigelo01", "crigelo01", "crigelo01", "crigelo01", "crigelo01", "crigelo01",
+#> "crigelo01", "crigelo01", "sullibi03", "sullibi03", "sullibi03", "sullibi03", "sullibi03", "sullibi03", "sullibi03", "sullibi03", "sullibi03", "sullibi03", "sullibi03", "sullibi03", "sullibi03", "sullibi03", "sullibi03", "sullibi03", "crawfsa01", "crawfsa01", "crawfsa01", "crawfsa01", "crawfsa01", "crawfsa01", "crawfsa01", "crawfsa01", "crawfsa01", "crawfsa01", "crawfsa01", "crawfsa01", "crawfsa01", "crawfsa01", "crawfsa01", "crawfsa01", "crawfsa01", "crawfsa01", "crawfsa01", "stonege01", "stonege01",
+#> "stonege01", "stonege01", "stonege01", "stonege01", "stonege01", "walshed01", "walshed01", "walshed01", "walshed01", "walshed01", "walshed01", "walshed01", "walshed01", "walshed01", "walshed01", "walshed01", "walshed01", "walshed01", "walshed01", "jossad01", "jossad01", "jossad01", "jossad01", "jossad01", "jossad01", "jossad01", "jossad01", "jossad01", "donovbi01", "donovbi01", "donovbi01", "donovbi01", "donovbi01", "donovbi01", "donovbi01", "donovbi01", "donovbi01", "donovbi01", "donovbi01", "donovbi01",
+#> "donovbi01", "donovbi01", "donovbi01", "donovbi01", "donovbi01", "donovbi01", "cobbty01", "cobbty01", "cobbty01", "cobbty01", "cobbty01", "cobbty01", "cobbty01", "cobbty01", "cobbty01", "cobbty01", "cobbty01", "cobbty01", "cobbty01", "cobbty01", "cobbty01", "cobbty01", "cobbty01", "cobbty01", "cobbty01", "cobbty01", "cobbty01", "cobbty01", "cobbty01", "cobbty01", "wallabo01", "wallabo01", "wallabo01", "wallabo01", "wallabo01", "wallabo01", "wallabo01", "wallabo01", "wallabo01", "wallabo01", "wallabo01",
+#> "wallabo01", "wallabo01", "wallabo01", "wallabo01", "wallabo01", "wallabo01", "wallabo01", "wallabo01", "wallabo01", "wallabo01", "wallabo01", "wallabo01", "wallabo01", "wallabo01", "devliar01", "devliar01", "devliar01", "devliar01", "devliar01", "devliar01", "devliar01", "devliar01", "devliar01", "devliar01", "bresnro01", "bresnro01", "bresnro01", "bresnro01", "bresnro01", "bresnro01", "bresnro01", "bresnro01", "bresnro01", "bresnro01", "bresnro01", "bresnro01", "bresnro01", "bresnro01", "bresnro01",
+#> "bresnro01", "bresnro01", "bresnro01", "klingjo01", "klingjo01", "klingjo01", "klingjo01", "klingjo01", "klingjo01", "klingjo01", "klingjo01", "klingjo01", "klingjo01", "klingjo01", "klingjo01", "klingjo01", "klingjo01", "donlimi01", "donlimi01", "donlimi01", "donlimi01", "donlimi01", "donlimi01", "donlimi01", "donlimi01", "donlimi01", "donlimi01", "donlimi01", "donlimi01", "donlimi01", "donlimi01", "clarkfr01", "clarkfr01", "clarkfr01", "clarkfr01", "clarkfr01", "clarkfr01", "clarkfr01", "clarkfr01",
+#> "clarkfr01", "clarkfr01", "clarkfr01", "clarkfr01", "clarkfr01", "clarkfr01", "clarkfr01", "clarkfr01", "clarkfr01", "clarkfr01", "clarkfr01", "clarkfr01", "clarkfr01", "brownmo01", "brownmo01", "brownmo01", "brownmo01", "brownmo01", "brownmo01", "brownmo01", "brownmo01", "brownmo01", "brownmo01", "brownmo01", "brownmo01", "brownmo01", "brownmo01", "brownmo01", "ruckena01", "ruckena01", "ruckena01", "ruckena01", "ruckena01", "ruckena01", "ruckena01", "ruckena01", "ruckena01", "ruckena01", "wagneho01",
+#> "wagneho01", "wagneho01", "wagneho01", "wagneho01", "wagneho01", "wagneho01", "wagneho01", "wagneho01", "wagneho01", "wagneho01", "wagneho01", "wagneho01", "wagneho01", "wagneho01", "wagneho01", "wagneho01", "wagneho01", "wagneho01", "wagneho01", "wagneho01", "tennefr02", "tennefr02", "tennefr02", "tennefr02", "tennefr02", "tennefr02", "tennefr02", "tennefr02", "tennefr02", "tennefr02", "tennefr02", "tennefr02", "tennefr02", "tennefr02", "tennefr02", "tennefr02", "tennefr02", "eversjo01", "eversjo01",
+#> "eversjo01", "eversjo01", "eversjo01", "eversjo01", "eversjo01", "eversjo01", "eversjo01", "eversjo01", "eversjo01", "eversjo01", "eversjo01", "eversjo01", "eversjo01", "eversjo01", "eversjo01", "eversjo01", "eversjo01", "willivi01", "willivi01", "willivi01", "willivi01", "willivi01", "willivi01", "willivi01", "willivi01", "willivi01", "willivi01", "willivi01", "willivi01", "willivi01", "reulbed01", "reulbed01", "reulbed01", "reulbed01", "reulbed01", "reulbed01", "reulbed01", "reulbed01", "reulbed01",
+#> "reulbed01", "reulbed01", "reulbed01", "reulbed01", "reulbed01", "schulfr01", "schulfr01", "schulfr01", "schulfr01", "schulfr01", "schulfr01", "schulfr01", "schulfr01", "schulfr01", "schulfr01", "schulfr01", "schulfr01", "schulfr01", "schulfr01", "schulfr01", "schulfr01", "schulfr01", "collied01", "collied01", "collied01", "collied01", "collied01", "collied01", "collied01", "collied01", "collied01", "collied01", "collied01", "collied01", "collied01", "collied01", "collied01", "collied01", "collied01",
+#> "collied01", "collied01", "collied01", "collied01", "collied01", "collied01", "collied01", "collied01", "carribi02", "carribi02", "carribi02", "carribi02", "carribi02", "carribi02", "carribi02", "carribi02", "carribi02", "carribi02", "streega01", "streega01", "streega01", "streega01", "streega01", "streega01", "streega01", "streega01", "streega01", "streega01", "speaktr01", "speaktr01", "speaktr01", "speaktr01", "speaktr01", "speaktr01", "speaktr01", "speaktr01", "speaktr01", "speaktr01", "speaktr01",
+#> "speaktr01", "speaktr01", "speaktr01", "speaktr01", "speaktr01", "speaktr01", "speaktr01", "speaktr01", "speaktr01", "speaktr01", "speaktr01", "planked01", "planked01", "planked01", "planked01", "planked01", "planked01", "planked01", "planked01", "planked01", "planked01", "planked01", "planked01", "planked01", "planked01", "planked01", "planked01", "planked01", "johnswa01", "johnswa01", "johnswa01", "johnswa01", "johnswa01", "johnswa01", "johnswa01", "johnswa01", "johnswa01", "johnswa01", "johnswa01",
+#> "johnswa01", "johnswa01", "johnswa01", "johnswa01", "johnswa01", "johnswa01", "johnswa01", "johnswa01", "johnswa01", "johnswa01", "mullige01", "mullige01", "mullige01", "mullige01", "mullige01", "mullige01", "mullige01", "mullige01", "mullige01", "mullige01", "mullige01", "mullige01", "mullige01", "mullige01", "mullige01", "woodjo02", "woodjo02", "woodjo02", "woodjo02", "woodjo02", "woodjo02", "woodjo02", "woodjo02", "woodjo02", "woodjo02", "woodjo02", "woodjo02", "woodjo02", "woodjo02", "bushdo01",
+#> "bushdo01", "bushdo01", "bushdo01", "bushdo01", "bushdo01", "bushdo01", "bushdo01", "bushdo01", "bushdo01", "bushdo01", "bushdo01", "bushdo01", "bushdo01", "bushdo01", "bushdo01", "bushdo01", "gibsoge01", "gibsoge01", "gibsoge01", "gibsoge01", "gibsoge01", "gibsoge01", "gibsoge01", "gibsoge01", "gibsoge01", "gibsoge01", "gibsoge01", "gibsoge01", "gibsoge01", "gibsoge01", "adamsba01", "adamsba01", "adamsba01", "adamsba01", "adamsba01", "adamsba01", "adamsba01", "adamsba01", "adamsba01", "adamsba01",
+#> "adamsba01", "adamsba01", "adamsba01", "adamsba01", "adamsba01", "adamsba01", "adamsba01", "adamsba01", "adamsba01", "chancfr01", "chancfr01", "chancfr01", "chancfr01", "chancfr01", "chancfr01", "chancfr01", "chancfr01", "chancfr01", "chancfr01", "chancfr01", "chancfr01", "chancfr01", "chancfr01", "chancfr01", "chancfr01", "chancfr01", "leachto01", "leachto01", "leachto01", "leachto01", "leachto01", "leachto01", "leachto01", "leachto01", "leachto01", "leachto01", "leachto01", "leachto01", "leachto01",
+#> "leachto01", "leachto01", "leachto01", "leachto01", "leachto01", "leachto01", "leachto01", "camniho01", "camniho01", "camniho01", "camniho01", "camniho01", "camniho01", "camniho01", "camniho01", "camniho01", "camniho01", "camniho01", "camniho01", "hofmaso01", "hofmaso01", "hofmaso01", "hofmaso01", "hofmaso01", "hofmaso01", "hofmaso01", "hofmaso01", "hofmaso01", "hofmaso01", "hofmaso01", "hofmaso01", "hofmaso01", "hofmaso01", "hofmaso01", "hofmaso01", "thomair01", "thomair01", "thomair01", "thomair01",
+#> "thomair01", "thomair01", "thomair01", "thomair01", "thomair01", "thomair01", "sweened01", "sweened01", "sweened01", "sweened01", "sweened01", "sweened01", "sweened01", "sweened01", "sweened01", "coombja01", "coombja01", "coombja01", "coombja01", "coombja01", "coombja01", "coombja01", "coombja01", "coombja01", "coombja01", "coombja01", "coombja01", "coombja01", "coombja01", "bendech01", "bendech01", "bendech01", "bendech01", "bendech01", "bendech01", "bendech01", "bendech01", "bendech01", "bendech01",
+#> "bendech01", "bendech01", "bendech01", "bendech01", "bendech01", "bendech01", "archeji01", "archeji01", "archeji01", "archeji01", "archeji01", "archeji01", "archeji01", "archeji01", "archeji01", "archeji01", "archeji01", "archeji01", "archeji01", "archeji01", "mageesh01", "mageesh01", "mageesh01", "mageesh01", "mageesh01", "mageesh01", "mageesh01", "mageesh01", "mageesh01", "mageesh01", "mageesh01", "mageesh01", "mageesh01", "mageesh01", "mageesh01", "mageesh01", "mageesh01", "coleki01", "coleki01",
+#> "coleki01", "coleki01", "coleki01", "coleki01", "coleki01", "bakerfr01", "bakerfr01", "bakerfr01", "bakerfr01", "bakerfr01", "bakerfr01", "bakerfr01", "bakerfr01", "bakerfr01", "bakerfr01", "bakerfr01", "bakerfr01", "bakerfr01", "stanaos01", "stanaos01", "stanaos01", "stanaos01", "stanaos01", "stanaos01", "stanaos01", "stanaos01", "stanaos01", "stanaos01", "stanaos01", "stanaos01", "stanaos01", "stanaos01", "greggve01", "greggve01", "greggve01", "greggve01", "greggve01", "greggve01", "greggve01",
+#> "greggve01", "greggve01", "jacksjo01", "jacksjo01", "jacksjo01", "jacksjo01", "jacksjo01", "jacksjo01", "jacksjo01", "jacksjo01", "jacksjo01", "jacksjo01", "jacksjo01", "jacksjo01", "jacksjo01", "jacksjo01", "dooinre01", "dooinre01", "dooinre01", "dooinre01", "dooinre01", "dooinre01", "dooinre01", "dooinre01", "dooinre01", "dooinre01", "dooinre01", "dooinre01", "dooinre01", "dooinre01", "dooinre01", "dooinre01", "meyerch01", "meyerch01", "meyerch01", "meyerch01", "meyerch01", "meyerch01", "meyerch01",
+#> "meyerch01", "meyerch01", "meyerch01", "alexape01", "alexape01", "alexape01", "alexape01", "alexape01", "alexape01", "alexape01", "alexape01", "alexape01", "alexape01", "alexape01", "alexape01", "alexape01", "alexape01", "alexape01", "alexape01", "alexape01", "alexape01", "alexape01", "alexape01", "alexape01", "daubeja01", "daubeja01", "daubeja01", "daubeja01", "daubeja01", "daubeja01", "daubeja01", "daubeja01", "daubeja01", "daubeja01", "daubeja01", "daubeja01", "daubeja01", "daubeja01", "daubeja01",
+#> "doylela01", "doylela01", "doylela01", "doylela01", "doylela01", "doylela01", "doylela01", "doylela01", "doylela01", "doylela01", "doylela01", "doylela01", "doylela01", "doylela01", "doylela01", "loberha01", "loberha01", "loberha01", "loberha01", "loberha01", "loberha01", "loberha01", "loberha01", "loberha01", "loberha01", "loberha01", "loberha01", "loberha01", "loberha01", "marquru01", "marquru01", "marquru01", "marquru01", "marquru01", "marquru01", "marquru01", "marquru01", "marquru01", "marquru01",
+#> "marquru01", "marquru01", "marquru01", "marquru01", "marquru01", "marquru01", "marquru01", "marquru01", "marquru01", "mcinnst01", "mcinnst01", "mcinnst01", "mcinnst01", "mcinnst01", "mcinnst01", "mcinnst01", "mcinnst01", "mcinnst01", "mcinnst01", "mcinnst01", "mcinnst01", "mcinnst01", "mcinnst01", "mcinnst01", "mcinnst01", "mcinnst01", "mcinnst01", "mcinnst01", "gardnla01", "gardnla01", "gardnla01", "gardnla01", "gardnla01", "gardnla01", "gardnla01", "gardnla01", "gardnla01", "gardnla01", "gardnla01",
+#> "gardnla01", "gardnla01", "gardnla01", "gardnla01", "gardnla01", "gardnla01", "ainsmed01", "ainsmed01", "ainsmed01", "ainsmed01", "ainsmed01", "ainsmed01", "ainsmed01", "ainsmed01", "ainsmed01", "ainsmed01", "ainsmed01", "ainsmed01", "ainsmed01", "ainsmed01", "ainsmed01", "ainsmed01", "ainsmed01", "wagnehe01", "wagnehe01", "wagnehe01", "wagnehe01", "wagnehe01", "wagnehe01", "wagnehe01", "wagnehe01", "wagnehe01", "wagnehe01", "wagnehe01", "wagnehe01", "zimmehe01", "zimmehe01", "zimmehe01", "zimmehe01",
+#> "zimmehe01", "zimmehe01", "zimmehe01", "zimmehe01", "zimmehe01", "zimmehe01", "zimmehe01", "zimmehe01", "zimmehe01", "zimmehe01", "paskedo01", "paskedo01", "paskedo01", "paskedo01", "paskedo01", "paskedo01", "paskedo01", "paskedo01", "paskedo01", "paskedo01", "paskedo01", "paskedo01", "paskedo01", "paskedo01", "paskedo01", "wilsoch01", "wilsoch01", "wilsoch01", "wilsoch01", "wilsoch01", "wilsoch01", "wilsoch01", "wilsoch01", "wilsoch01", "tesreje01", "tesreje01", "tesreje01", "tesreje01", "tesreje01",
+#> "tesreje01", "tesreje01", "schanwa01", "schanwa01", "schanwa01", "schanwa01", "schanwa01", "schanwa01", "schanwa01", "schanwa01", "schanwa01", "schanwa01", "schanwa01", "schanwa01", "schanwa01", "schanwa01", "schanwa01", "schanwa01", "schanwa01", "schanwa01", "schanwa01", "falkecy01", "falkecy01", "falkecy01", "falkecy01", "falkecy01", "falkecy01", "falkecy01", "falkecy01", "falkecy01", "falkecy01", "falkecy01", "falkecy01", "falkecy01", "falkecy01", "barryja01", "barryja01", "barryja01", "barryja01",
+#> "barryja01", "barryja01", "barryja01", "barryja01", "barryja01", "barryja01", "barryja01", "barryja01", "vioxji01", "vioxji01", "vioxji01", "vioxji01", "vioxji01", "cravaga01", "cravaga01", "cravaga01", "cravaga01", "cravaga01", "cravaga01", "cravaga01", "cravaga01", "cravaga01", "cravaga01", "cravaga01", "cravaga01", "wheatza01", "wheatza01", "wheatza01", "wheatza01", "wheatza01", "wheatza01", "wheatza01", "wheatza01", "wheatza01", "wheatza01", "wheatza01", "wheatza01", "wheatza01", "wheatza01",
+#> "wheatza01", "wheatza01", "wheatza01", "wheatza01", "wheatza01", "schalra01", "schalra01", "schalra01", "schalra01", "schalra01", "schalra01", "schalra01", "schalra01", "schalra01", "schalra01", "schalra01", "schalra01", "schalra01", "schalra01", "schalra01", "schalra01", "schalra01", "schalra01", "leonadu01", "leonadu01", "leonadu01", "leonadu01", "leonadu01", "leonadu01", "leonadu01", "leonadu01", "leonadu01", "leonadu01", "leonadu01", "maranra01", "maranra01", "maranra01", "maranra01", "maranra01",
+#> "maranra01", "maranra01", "maranra01", "maranra01", "maranra01", "maranra01", "maranra01", "maranra01", "maranra01", "maranra01", "maranra01", "maranra01", "maranra01", "maranra01", "maranra01", "maranra01", "maranra01", "maranra01", "wingoiv01", "wingoiv01", "wingoiv01", "wingoiv01", "wingoiv01", "wingoiv01", "wingoiv01", "wingoiv01", "wingoiv01", "wingoiv01", "wingoiv01", "wingoiv01", "wingoiv01", "wingoiv01", "wingoiv01", "wingoiv01", "wingoiv01", "burnsge01", "burnsge01", "burnsge01", "burnsge01",
+#> "burnsge01", "burnsge01", "burnsge01", "burnsge01", "burnsge01", "burnsge01", "burnsge01", "burnsge01", "burnsge01", "burnsge01", "burnsge01", "jamesbi02", "jamesbi02", "jamesbi02", "jamesbi02", "maisefr01", "maisefr01", "maisefr01", "maisefr01", "maisefr01", "maisefr01", "scottji01", "scottji01", "scottji01", "scottji01", "scottji01", "scottji01", "scottji01", "scottji01", "scottji01", "grohhe01", "grohhe01", "grohhe01", "grohhe01", "grohhe01", "grohhe01", "grohhe01", "grohhe01", "grohhe01", "grohhe01",
+#> "grohhe01", "grohhe01", "grohhe01", "grohhe01", "grohhe01", "grohhe01", "grohhe01", "snydefr01", "snydefr01", "snydefr01", "snydefr01", "snydefr01", "snydefr01", "snydefr01", "snydefr01", "snydefr01", "snydefr01", "snydefr01", "snydefr01", "snydefr01", "snydefr01", "snydefr01", "snydefr01", "snydefr01", "bancrda01", "bancrda01", "bancrda01", "bancrda01", "bancrda01", "bancrda01", "bancrda01", "bancrda01", "bancrda01", "bancrda01", "bancrda01", "bancrda01", "bancrda01", "bancrda01", "bancrda01", "bancrda01",
+#> "bancrda01", "saiervi01", "saiervi01", "saiervi01", "saiervi01", "saiervi01", "saiervi01", "saiervi01", "saiervi01", "willicy01", "willicy01", "willicy01", "willicy01", "willicy01", "willicy01", "willicy01", "willicy01", "willicy01", "willicy01", "willicy01", "willicy01", "willicy01", "willicy01", "willicy01", "willicy01", "willicy01", "willicy01", "willicy01", "mamaual01", "mamaual01", "mamaual01", "mamaual01", "mamaual01", "mamaual01", "mamaual01", "mamaual01", "mamaual01", "mamaual01", "mamaual01",
+#> "mamaual01", "sislege01", "sislege01", "sislege01", "sislege01", "sislege01", "sislege01", "sislege01", "sislege01", "sislege01", "sislege01", "sislege01", "sislege01", "sislege01", "sislege01", "sislege01", "sislege01", "ruthba01", "ruthba01", "ruthba01", "ruthba01", "ruthba01", "ruthba01", "ruthba01", "ruthba01", "ruthba01", "ruthba01", "ruthba01", "ruthba01", "ruthba01", "ruthba01", "ruthba01", "ruthba01", "ruthba01", "ruthba01", "ruthba01", "ruthba01", "ruthba01", "ruthba01", "herzobu01", "herzobu01",
+#> "herzobu01", "herzobu01", "herzobu01", "herzobu01", "herzobu01", "herzobu01", "herzobu01", "herzobu01", "herzobu01", "herzobu01", "herzobu01", "herzobu01", "herzobu01", "herzobu01", "hornsro01", "hornsro01", "hornsro01", "hornsro01", "hornsro01", "hornsro01", "hornsro01", "hornsro01", "hornsro01", "hornsro01", "hornsro01", "hornsro01", "hornsro01", "hornsro01", "hornsro01", "hornsro01", "hornsro01", "hornsro01", "hornsro01", "hornsro01", "hornsro01", "hornsro01", "hornsro01", "hornsro01", "gowdyha01",
+#> "gowdyha01", "gowdyha01", "gowdyha01", "gowdyha01", "gowdyha01", "gowdyha01", "gowdyha01", "gowdyha01", "gowdyha01", "gowdyha01", "gowdyha01", "gowdyha01", "gowdyha01", "gowdyha01", "gowdyha01", "gowdyha01", "gowdyha01", "gowdyha01", "roberda01", "roberda01", "roberda01", "roberda01", "roberda01", "roberda01", "roberda01", "roberda01", "roberda01", "roberda01", "roberda01", "weavebu01", "weavebu01", "weavebu01", "weavebu01", "weavebu01", "weavebu01", "weavebu01", "weavebu01", "weavebu01", "felscha01",
+#> "felscha01", "felscha01", "felscha01", "felscha01", "felscha01", "cicoted01", "cicoted01", "cicoted01", "cicoted01", "cicoted01", "cicoted01", "cicoted01", "cicoted01", "cicoted01", "cicoted01", "cicoted01", "cicoted01", "cicoted01", "cicoted01", "cicoted01", "chapmra01", "chapmra01", "chapmra01", "chapmra01", "chapmra01", "chapmra01", "chapmra01", "chapmra01", "chapmra01", "killebi01", "killebi01", "killebi01", "killebi01", "killebi01", "killebi01", "killebi01", "killebi01", "killebi01", "killebi01",
+#> "killebi01", "killebi01", "killebi01", "roushed01", "roushed01", "roushed01", "roushed01", "roushed01", "roushed01", "roushed01", "roushed01", "roushed01", "roushed01", "roushed01", "roushed01", "roushed01", "roushed01", "roushed01", "roushed01", "roushed01", "roushed01", "roushed01", "careyma01", "careyma01", "careyma01", "careyma01", "careyma01", "careyma01", "careyma01", "careyma01", "careyma01", "careyma01", "careyma01", "careyma01", "careyma01", "careyma01", "careyma01", "careyma01", "careyma01",
+#> "careyma01", "careyma01", "careyma01", "careyma01", "coopewi01", "coopewi01", "coopewi01", "coopewi01", "coopewi01", "coopewi01", "coopewi01", "coopewi01", "coopewi01", "coopewi01", "coopewi01", "coopewi01", "coopewi01", "coopewi01", "coopewi01", "coopewi01", "oneilst01", "oneilst01", "oneilst01", "oneilst01", "oneilst01", "oneilst01", "oneilst01", "oneilst01", "oneilst01", "oneilst01", "oneilst01", "oneilst01", "oneilst01", "oneilst01", "oneilst01", "oneilst01", "oneilst01", "hoopeha01", "hoopeha01",
+#> "hoopeha01", "hoopeha01", "hoopeha01", "hoopeha01", "hoopeha01", "hoopeha01", "hoopeha01", "hoopeha01", "hoopeha01", "hoopeha01", "hoopeha01", "hoopeha01", "hoopeha01", "hoopeha01", "hoopeha01", "vaughhi01", "vaughhi01", "vaughhi01", "vaughhi01", "vaughhi01", "vaughhi01", "vaughhi01", "vaughhi01", "vaughhi01", "vaughhi01", "vaughhi01", "vaughhi01", "vaughhi01", "vaughhi01", "holloch01", "holloch01", "holloch01", "holloch01", "holloch01", "holloch01", "holloch01", "cutshge01", "cutshge01", "cutshge01",
+#> "cutshge01", "cutshge01", "cutshge01", "cutshge01", "cutshge01", "cutshge01", "cutshge01", "cutshge01", "cutshge01", "grimebu01", "grimebu01", "grimebu01", "grimebu01", "grimebu01", "grimebu01", "grimebu01", "grimebu01", "grimebu01", "grimebu01", "grimebu01", "grimebu01", "grimebu01", "grimebu01", "grimebu01", "grimebu01", "grimebu01", "grimebu01", "grimebu01", "grimebu01", "grimebu01", "grimebu01", "grimebu01", "peckiro01", "peckiro01", "peckiro01", "peckiro01", "peckiro01", "peckiro01", "peckiro01",
+#> "peckiro01", "peckiro01", "peckiro01", "peckiro01", "peckiro01", "peckiro01", "peckiro01", "peckiro01", "peckiro01", "peckiro01", "peckiro01", "stockmi01", "stockmi01", "stockmi01", "stockmi01", "stockmi01", "stockmi01", "stockmi01", "stockmi01", "stockmi01", "stockmi01", "stockmi01", "stockmi01", "stockmi01", "stockmi01", "myershy01", "myershy01", "myershy01", "myershy01", "myershy01", "myershy01", "myershy01", "myershy01", "myershy01", "myershy01", "myershy01", "myershy01", "myershy01", "myershy01",
+#> "myershy01", "myershy01", "barneje01", "barneje01", "barneje01", "barneje01", "barneje01", "barneje01", "barneje01", "barneje01", "barneje01", "barneje01", "barneje01", "barneje01", "barneje01", "barneje01", "ricesa01", "ricesa01", "ricesa01", "ricesa01", "ricesa01", "ricesa01", "ricesa01", "ricesa01", "ricesa01", "ricesa01", "ricesa01", "ricesa01", "ricesa01", "ricesa01", "ricesa01", "ricesa01", "ricesa01", "ricesa01", "ricesa01", "ricesa01", "bagbyji01", "bagbyji01", "bagbyji01", "bagbyji01", "bagbyji01",
+#> "bagbyji01", "bagbyji01", "bagbyji01", "bagbyji01", "covelst01", "covelst01", "covelst01", "covelst01", "covelst01", "covelst01", "covelst01", "covelst01", "covelst01", "covelst01", "covelst01", "covelst01", "covelst01", "covelst01", "shockur01", "shockur01", "shockur01", "shockur01", "shockur01", "shockur01", "shockur01", "shockur01", "shockur01", "shockur01", "shockur01", "shockur01", "shockur01", "scottev01", "scottev01", "scottev01", "scottev01", "scottev01", "scottev01", "scottev01", "scottev01",
+#> "scottev01", "scottev01", "scottev01", "scottev01", "scottev01", "scottev01", "scottev01", "schmiwa01", "schmiwa01", "schmiwa01", "schmiwa01", "schmiwa01", "schmiwa01", "schmiwa01", "schmiwa01", "schmiwa01", "schmiwa01", "youngro01", "youngro01", "youngro01", "youngro01", "youngro01", "youngro01", "youngro01", "youngro01", "youngro01", "youngro01", "faberre01", "faberre01", "faberre01", "faberre01", "faberre01", "faberre01", "faberre01", "faberre01", "faberre01", "faberre01", "faberre01", "faberre01",
+#> "faberre01", "faberre01", "faberre01", "faberre01", "faberre01", "faberre01", "faberre01", "faberre01", "maysca01", "maysca01", "maysca01", "maysca01", "maysca01", "maysca01", "maysca01", "maysca01", "maysca01", "maysca01", "maysca01", "maysca01", "maysca01", "maysca01", "maysca01", "maysca01", "friscfr01", "friscfr01", "friscfr01", "friscfr01", "friscfr01", "friscfr01", "friscfr01", "friscfr01", "friscfr01", "friscfr01", "friscfr01", "friscfr01", "friscfr01", "friscfr01", "friscfr01", "friscfr01",
+#> "friscfr01", "friscfr01", "friscfr01", "kellyge01", "kellyge01", "kellyge01", "kellyge01", "kellyge01", "kellyge01", "kellyge01", "kellyge01", "kellyge01", "kellyge01", "kellyge01", "kellyge01", "kellyge01", "kellyge01", "kellyge01", "kellyge01", "kellyge01", "kellyge01", "bigbeca01", "bigbeca01", "bigbeca01", "bigbeca01", "bigbeca01", "bigbeca01", "bigbeca01", "bigbeca01", "bigbeca01", "bigbeca01", "bigbeca01", "nehfar01", "nehfar01", "nehfar01", "nehfar01", "nehfar01", "nehfar01", "nehfar01", "nehfar01",
+#> "nehfar01", "nehfar01", "nehfar01", "nehfar01", "nehfar01", "nehfar01", "nehfar01", "nehfar01", "nehfar01", "nehfar01", "duganjo01", "duganjo01", "duganjo01", "duganjo01", "duganjo01", "duganjo01", "duganjo01", "duganjo01", "duganjo01", "duganjo01", "duganjo01", "duganjo01", "duganjo01", "duganjo01", "duganjo01", "bushjo01", "bushjo01", "bushjo01", "bushjo01", "bushjo01", "bushjo01", "bushjo01", "bushjo01", "bushjo01", "bushjo01", "bushjo01", "bushjo01", "bushjo01", "bushjo01", "bushjo01", "bushjo01",
+#> "bushjo01", "bushjo01", "bushjo01", "rommeed01", "rommeed01", "rommeed01", "rommeed01", "rommeed01", "rommeed01", "rommeed01", "rommeed01", "rommeed01", "rommeed01", "rommeed01", "rommeed01", "rommeed01", "rixeyep01", "rixeyep01", "rixeyep01", "rixeyep01", "rixeyep01", "rixeyep01", "rixeyep01", "rixeyep01", "rixeyep01", "rixeyep01", "rixeyep01", "rixeyep01", "rixeyep01", "rixeyep01", "rixeyep01", "rixeyep01", "rixeyep01", "rixeyep01", "rixeyep01", "rixeyep01", "rixeyep01", "ruethdu01", "ruethdu01",
+#> "ruethdu01", "ruethdu01", "ruethdu01", "ruethdu01", "ruethdu01", "ruethdu01", "ruethdu01", "ruethdu01", "ruethdu01", "ruethdu01", "ruethdu01", "pippwa01", "pippwa01", "pippwa01", "pippwa01", "pippwa01", "pippwa01", "pippwa01", "pippwa01", "pippwa01", "pippwa01", "pippwa01", "pippwa01", "pippwa01", "pippwa01", "pippwa01", "perkicy01", "perkicy01", "perkicy01", "perkicy01", "perkicy01", "perkicy01", "perkicy01", "perkicy01", "perkicy01", "perkicy01", "perkicy01", "perkicy01", "perkicy01", "perkicy01",
+#> "perkicy01", "perkicy01", "perkicy01", "heilmha01", "heilmha01", "heilmha01", "heilmha01", "heilmha01", "heilmha01", "heilmha01", "heilmha01", "heilmha01", "heilmha01", "heilmha01", "heilmha01", "heilmha01", "heilmha01", "heilmha01", "heilmha01", "heilmha01", "uhlege01", "uhlege01", "uhlege01", "uhlege01", "uhlege01", "uhlege01", "uhlege01", "uhlege01", "uhlege01", "uhlege01", "uhlege01", "uhlege01", "uhlege01", "uhlege01", "uhlege01", "uhlege01", "uhlege01", "uhlege01", "uhlege01", "ehmkeho01",
+#> "ehmkeho01", "ehmkeho01", "ehmkeho01", "ehmkeho01", "ehmkeho01", "ehmkeho01", "ehmkeho01", "ehmkeho01", "ehmkeho01", "ehmkeho01", "ehmkeho01", "ehmkeho01", "ehmkeho01", "ehmkeho01", "ehmkeho01", "seweljo01", "seweljo01", "seweljo01", "seweljo01", "seweljo01", "seweljo01", "seweljo01", "seweljo01", "seweljo01", "seweljo01", "seweljo01", "seweljo01", "seweljo01", "seweljo01", "grimmch01", "grimmch01", "grimmch01", "grimmch01", "grimmch01", "grimmch01", "grimmch01", "grimmch01", "grimmch01", "grimmch01",
+#> "grimmch01", "grimmch01", "grimmch01", "grimmch01", "grimmch01", "grimmch01", "grimmch01", "grimmch01", "grimmch01", "grimmch01", "ofarrbo01", "ofarrbo01", "ofarrbo01", "ofarrbo01", "ofarrbo01", "ofarrbo01", "ofarrbo01", "ofarrbo01", "ofarrbo01", "ofarrbo01", "ofarrbo01", "ofarrbo01", "ofarrbo01", "ofarrbo01", "ofarrbo01", "ofarrbo01", "ofarrbo01", "ofarrbo01", "ofarrbo01", "ofarrbo01", "ofarrbo01", "ofarrbo01", "ofarrbo01", "ofarrbo01", "luquedo01", "luquedo01", "luquedo01", "luquedo01", "luquedo01",
+#> "luquedo01", "luquedo01", "luquedo01", "luquedo01", "luquedo01", "luquedo01", "luquedo01", "luquedo01", "luquedo01", "luquedo01", "luquedo01", "luquedo01", "luquedo01", "luquedo01", "luquedo01", "morrijo04", "morrijo04", "morrijo04", "morrijo04", "morrijo04", "morrijo04", "morrijo04", "morrijo04", "morrijo04", "morrijo04", "vanceda01", "vanceda01", "vanceda01", "vanceda01", "vanceda01", "vanceda01", "vanceda01", "vanceda01", "vanceda01", "vanceda01", "vanceda01", "vanceda01", "vanceda01", "vanceda01",
+#> "vanceda01", "vanceda01", "vanceda01", "vanceda01", "judgejo01", "judgejo01", "judgejo01", "judgejo01", "judgejo01", "judgejo01", "judgejo01", "judgejo01", "judgejo01", "judgejo01", "judgejo01", "judgejo01", "judgejo01", "judgejo01", "judgejo01", "judgejo01", "judgejo01", "judgejo01", "judgejo01", "judgejo01", "judgejo01", "bassljo01", "bassljo01", "bassljo01", "bassljo01", "bassljo01", "bassljo01", "bassljo01", "bassljo01", "bassljo01", "jamiech01", "jamiech01", "jamiech01", "jamiech01", "jamiech01",
+#> "jamiech01", "jamiech01", "jamiech01", "jamiech01", "jamiech01", "jamiech01", "jamiech01", "jamiech01", "jamiech01", "jamiech01", "jamiech01", "jamiech01", "jamiech01", "jamiech01", "thurssl01", "thurssl01", "thurssl01", "thurssl01", "thurssl01", "thurssl01", "thurssl01", "thurssl01", "thurssl01", "thurssl01", "pennohe01", "pennohe01", "pennohe01", "pennohe01", "pennohe01", "pennohe01", "pennohe01", "pennohe01", "pennohe01", "pennohe01", "pennohe01", "pennohe01", "pennohe01", "pennohe01", "pennohe01",
+#> "pennohe01", "pennohe01", "pennohe01", "pennohe01", "pennohe01", "pennohe01", "pennohe01", "pennohe01", "jackstr01", "jackstr01", "jackstr01", "jackstr01", "jackstr01", "jackstr01", "jackstr01", "jackstr01", "jackstr01", "jackstr01", "jackstr01", "jackstr01", "jackstr01", "jackstr01", "jackstr01", "traynpi01", "traynpi01", "traynpi01", "traynpi01", "traynpi01", "traynpi01", "traynpi01", "traynpi01", "traynpi01", "traynpi01", "traynpi01", "traynpi01", "traynpi01", "traynpi01", "traynpi01", "traynpi01",
+#> "traynpi01", "hartnga01", "hartnga01", "hartnga01", "hartnga01", "hartnga01", "hartnga01", "hartnga01", "hartnga01", "hartnga01", "hartnga01", "hartnga01", "hartnga01", "hartnga01", "hartnga01", "hartnga01", "hartnga01", "hartnga01", "hartnga01", "hartnga01", "hartnga01", "bluegos01", "bluegos01", "bluegos01", "bluegos01", "bluegos01", "bluegos01", "bluegos01", "bluegos01", "bluegos01", "bluegos01", "bluegos01", "bluegos01", "bluegos01", "bluegos01", "bluegos01", "bluegos01", "bluegos01", "bluegos01",
+#> "ruelmu01", "ruelmu01", "ruelmu01", "ruelmu01", "ruelmu01", "ruelmu01", "ruelmu01", "ruelmu01", "ruelmu01", "ruelmu01", "ruelmu01", "ruelmu01", "ruelmu01", "ruelmu01", "ruelmu01", "ruelmu01", "ruelmu01", "ruelmu01", "ruelmu01", "ruelmu01", "cochrmi01", "cochrmi01", "cochrmi01", "cochrmi01", "cochrmi01", "cochrmi01", "cochrmi01", "cochrmi01", "cochrmi01", "cochrmi01", "cochrmi01", "cochrmi01", "cochrmi01", "simmoal01", "simmoal01", "simmoal01", "simmoal01", "simmoal01", "simmoal01", "simmoal01", "simmoal01",
+#> "simmoal01", "simmoal01", "simmoal01", "simmoal01", "simmoal01", "simmoal01", "simmoal01", "simmoal01", "simmoal01", "simmoal01", "simmoal01", "simmoal01", "simmoal01", "gosligo01", "gosligo01", "gosligo01", "gosligo01", "gosligo01", "gosligo01", "gosligo01", "gosligo01", "gosligo01", "gosligo01", "gosligo01", "gosligo01", "gosligo01", "gosligo01", "gosligo01", "gosligo01", "gosligo01", "gosligo01", "gosligo01", "lyonste01", "lyonste01", "lyonste01", "lyonste01", "lyonste01", "lyonste01", "lyonste01",
+#> "lyonste01", "lyonste01", "lyonste01", "lyonste01", "lyonste01", "lyonste01", "lyonste01", "lyonste01", "lyonste01", "lyonste01", "lyonste01", "lyonste01", "lyonste01", "lyonste01", "cuyleki01", "cuyleki01", "cuyleki01", "cuyleki01", "cuyleki01", "cuyleki01", "cuyleki01", "cuyleki01", "cuyleki01", "cuyleki01", "cuyleki01", "cuyleki01", "cuyleki01", "cuyleki01", "cuyleki01", "cuyleki01", "cuyleki01", "cuyleki01", "cuyleki01", "wrighgl01", "wrighgl01", "wrighgl01", "wrighgl01", "wrighgl01", "wrighgl01",
+#> "wrighgl01", "wrighgl01", "wrighgl01", "wrighgl01", "wrighgl01", "bottoji01", "bottoji01", "bottoji01", "bottoji01", "bottoji01", "bottoji01", "bottoji01", "bottoji01", "bottoji01", "bottoji01", "bottoji01", "bottoji01", "bottoji01", "bottoji01", "bottoji01", "bottoji01", "smithea02", "smithea02", "smithea02", "smithea02", "smithea02", "smithea02", "smithea02", "smithea02", "smithea02", "smithea02", "smithea02", "smithea02", "smithea02", "smithea02", "smithea02", "donohpe01", "donohpe01", "donohpe01",
+#> "donohpe01", "donohpe01", "donohpe01", "donohpe01", "donohpe01", "donohpe01", "donohpe01", "donohpe01", "donohpe01", "donohpe01", "donohpe01", "burnsge02", "burnsge02", "burnsge02", "burnsge02", "burnsge02", "burnsge02", "burnsge02", "burnsge02", "burnsge02", "burnsge02", "burnsge02", "burnsge02", "burnsge02", "burnsge02", "burnsge02", "burnsge02", "burnsge02", "burnsge02", "burnsge02", "kammwi01", "kammwi01", "kammwi01", "kammwi01", "kammwi01", "kammwi01", "kammwi01", "kammwi01", "kammwi01", "kammwi01",
+#> "kammwi01", "kammwi01", "kammwi01", "kammwi01", "manushe01", "manushe01", "manushe01", "manushe01", "manushe01", "manushe01", "manushe01", "manushe01", "manushe01", "manushe01", "manushe01", "manushe01", "manushe01", "manushe01", "manushe01", "manushe01", "manushe01", "manushe01", "manushe01", "mostijo01", "mostijo01", "mostijo01", "mostijo01", "mostijo01", "mostijo01", "mostijo01", "mostijo01", "mostijo01", "mostijo01", "grovele01", "grovele01", "grovele01", "grovele01", "grovele01", "grovele01",
+#> "grovele01", "grovele01", "grovele01", "grovele01", "grovele01", "grovele01", "grovele01", "grovele01", "grovele01", "grovele01", "grovele01", "kremera01", "kremera01", "kremera01", "kremera01", "kremera01", "kremera01", "kremera01", "kremera01", "kremera01", "kremera01", "wilsoha01", "wilsoha01", "wilsoha01", "wilsoha01", "wilsoha01", "wilsoha01", "wilsoha01", "wilsoha01", "wilsoha01", "wilsoha01", "wilsoha01", "wilsoha01", "wilsoha01", "carlsha01", "carlsha01", "carlsha01", "carlsha01", "carlsha01",
+#> "carlsha01", "carlsha01", "carlsha01", "carlsha01", "carlsha01", "carlsha01", "carlsha01", "carlsha01", "carlsha01", "carlsha01", "pettyje01", "pettyje01", "pettyje01", "pettyje01", "pettyje01", "pettyje01", "pettyje01", "pettyje01", "gehrilo01", "gehrilo01", "gehrilo01", "gehrilo01", "gehrilo01", "gehrilo01", "gehrilo01", "gehrilo01", "gehrilo01", "gehrilo01", "gehrilo01", "gehrilo01", "gehrilo01", "gehrilo01", "gehrilo01", "gehrilo01", "gehrilo01", "lazzeto01", "lazzeto01", "lazzeto01", "lazzeto01",
+#> "lazzeto01", "lazzeto01", "lazzeto01", "lazzeto01", "lazzeto01", "lazzeto01", "lazzeto01", "lazzeto01", "lazzeto01", "lazzeto01", "lazzeto01", "hoytwa01", "hoytwa01", "hoytwa01", "hoytwa01", "hoytwa01", "hoytwa01", "hoytwa01", "hoytwa01", "hoytwa01", "hoytwa01", "hoytwa01", "hoytwa01", "hoytwa01", "hoytwa01", "hoytwa01", "hoytwa01", "hoytwa01", "hoytwa01", "hoytwa01", "hoytwa01", "hoytwa01", "hoytwa01", "hoytwa01", "hoytwa01", "hoytwa01", "thomato02", "thomato02", "thomato02", "thomato02", "thomato02",
+#> "thomato02", "thomato02", "thomato02", "thomato02", "thomato02", "thomato02", "thomato02", "thomato02", "thomato02", "thomato02", "rootch01", "rootch01", "rootch01", "rootch01", "rootch01", "rootch01", "rootch01", "rootch01", "rootch01", "rootch01", "rootch01", "rootch01", "rootch01", "rootch01", "rootch01", "rootch01", "rootch01", "haineje01", "haineje01", "haineje01", "haineje01", "haineje01", "haineje01", "haineje01", "haineje01", "haineje01", "haineje01", "haineje01", "haineje01", "haineje01",
+#> "haineje01", "haineje01", "haineje01", "haineje01", "haineje01", "haineje01", "wanerpa01", "wanerpa01", "wanerpa01", "wanerpa01", "wanerpa01", "wanerpa01", "wanerpa01", "wanerpa01", "wanerpa01", "wanerpa01", "wanerpa01", "wanerpa01", "wanerpa01", "wanerpa01", "wanerpa01", "wanerpa01", "wanerpa01", "wanerpa01", "wanerpa01", "wanerpa01", "wanerpa01", "wanerpa01", "terrybi01", "terrybi01", "terrybi01", "terrybi01", "terrybi01", "terrybi01", "terrybi01", "terrybi01", "terrybi01", "terrybi01", "terrybi01",
+#> "terrybi01", "terrybi01", "terrybi01", "wilsoji01", "wilsoji01", "wilsoji01", "wilsoji01", "wilsoji01", "wilsoji01", "wilsoji01", "wilsoji01", "wilsoji01", "wilsoji01", "wilsoji01", "wilsoji01", "wilsoji01", "wilsoji01", "wilsoji01", "wilsoji01", "wilsoji01", "wilsoji01", "wilsoji01", "wanerll01", "wanerll01", "wanerll01", "wanerll01", "wanerll01", "wanerll01", "wanerll01", "wanerll01", "wanerll01", "wanerll01", "wanerll01", "wanerll01", "wanerll01", "wanerll01", "wanerll01", "wanerll01", "wanerll01",
+#> "wanerll01", "wanerll01", "wanerll01", "wanerll01", "crowdal01", "crowdal01", "crowdal01", "crowdal01", "crowdal01", "crowdal01", "crowdal01", "crowdal01", "crowdal01", "crowdal01", "crowdal01", "crowdal01", "crowdal01", "crowdal01", "morried02", "morried02", "morried02", "morried02", "morried02", "bentola01", "bentola01", "bentola01", "bentola01", "bentola01", "bentola01", "bentola01", "bentola01", "bentola01", "bentola01", "bentola01", "bentola01", "bentola01", "bentola01", "bentola01", "hafeych01",
+#> "hafeych01", "hafeych01", "hafeych01", "hafeych01", "hafeych01", "hafeych01", "hafeych01", "hafeych01", "hafeych01", "hafeych01", "hafeych01", "hafeych01", "sherdbi01", "sherdbi01", "sherdbi01", "sherdbi01", "sherdbi01", "sherdbi01", "sherdbi01", "sherdbi01", "sherdbi01", "sherdbi01", "sherdbi01", "sherdbi01", "sherdbi01", "sherdbi01", "sherdbi01", "sherdbi01", "sherdbi01", "lindsfr01", "lindsfr01", "lindsfr01", "lindsfr01", "lindsfr01", "lindsfr01", "lindsfr01", "lindsfr01", "lindsfr01", "lindsfr01",
+#> "lindsfr01", "lindsfr01", "lindsfr01", "fonsele01", "fonsele01", "fonsele01", "fonsele01", "fonsele01", "fonsele01", "fonsele01", "fonsele01", "fonsele01", "fonsele01", "fonsele01", "fonsele01", "fonsele01", "gehrich01", "gehrich01", "gehrich01", "gehrich01", "gehrich01", "gehrich01", "gehrich01", "gehrich01", "gehrich01", "gehrich01", "gehrich01", "gehrich01", "gehrich01", "gehrich01", "gehrich01", "gehrich01", "gehrich01", "gehrich01", "gehrich01", "dykesji01", "dykesji01", "dykesji01", "dykesji01",
+#> "dykesji01", "dykesji01", "dykesji01", "dykesji01", "dykesji01", "dykesji01", "dykesji01", "dykesji01", "dykesji01", "dykesji01", "dykesji01", "dykesji01", "dykesji01", "dykesji01", "dykesji01", "dykesji01", "dykesji01", "dykesji01", "combsea01", "combsea01", "combsea01", "combsea01", "combsea01", "combsea01", "combsea01", "combsea01", "combsea01", "combsea01", "combsea01", "combsea01", "earnsge01", "earnsge01", "earnsge01", "earnsge01", "earnsge01", "earnsge01", "earnsge01", "earnsge01", "earnsge01",
+#> "earnsge01", "earnsge01", "graydo02", "graydo02", "graydo02", "graydo02", "graydo02", "graydo02", "graydo02", "graydo02", "graydo02", "graydo02", "ferrewe01", "ferrewe01", "ferrewe01", "ferrewe01", "ferrewe01", "ferrewe01", "ferrewe01", "ferrewe01", "ferrewe01", "ferrewe01", "ferrewe01", "ferrewe01", "ferrewe01", "ferrewe01", "ferrewe01", "ferrewe01", "ferrewe01", "kressre01", "kressre01", "kressre01", "kressre01", "kressre01", "kressre01", "kressre01", "kressre01", "kressre01", "kressre01", "kressre01",
+#> "kressre01", "kressre01", "kressre01", "kressre01", "kressre01", "kressre01", "malonpa02", "malonpa02", "malonpa02", "malonpa02", "malonpa02", "malonpa02", "malonpa02", "malonpa02", "malonpa02", "malonpa02", "lucasre01", "lucasre01", "lucasre01", "lucasre01", "lucasre01", "lucasre01", "lucasre01", "lucasre01", "lucasre01", "lucasre01", "lucasre01", "lucasre01", "lucasre01", "lucasre01", "lucasre01", "lucasre01", "hubbeca01", "hubbeca01", "hubbeca01", "hubbeca01", "hubbeca01", "hubbeca01", "hubbeca01",
+#> "hubbeca01", "hubbeca01", "hubbeca01", "hubbeca01", "hubbeca01", "hubbeca01", "hubbeca01", "hubbeca01", "hubbeca01", "odoulle01", "odoulle01", "odoulle01", "odoulle01", "odoulle01", "odoulle01", "odoulle01", "odoulle01", "odoulle01", "odoulle01", "odoulle01", "odoulle01", "foxxji01", "foxxji01", "foxxji01", "foxxji01", "foxxji01", "foxxji01", "foxxji01", "foxxji01", "foxxji01", "foxxji01", "foxxji01", "foxxji01", "foxxji01", "foxxji01", "foxxji01", "foxxji01", "foxxji01", "foxxji01", "foxxji01",
+#> "foxxji01", "foxxji01", "averiea01", "averiea01", "averiea01", "averiea01", "averiea01", "averiea01", "averiea01", "averiea01", "averiea01", "averiea01", "averiea01", "averiea01", "averiea01", "averiea01", "cronijo01", "cronijo01", "cronijo01", "cronijo01", "cronijo01", "cronijo01", "cronijo01", "cronijo01", "cronijo01", "cronijo01", "cronijo01", "cronijo01", "cronijo01", "cronijo01", "cronijo01", "cronijo01", "cronijo01", "cronijo01", "cronijo01", "cronijo01", "hallabi01", "hallabi01", "hallabi01",
+#> "hallabi01", "hallabi01", "hallabi01", "hallabi01", "hallabi01", "hallabi01", "hallabi01", "hallabi01", "hallabi01", "hallabi01", "melilsk01", "melilsk01", "melilsk01", "melilsk01", "melilsk01", "melilsk01", "melilsk01", "melilsk01", "melilsk01", "melilsk01", "melilsk01", "melilsk01", "melilsk01", "walberu01", "walberu01", "walberu01", "walberu01", "walberu01", "walberu01", "walberu01", "walberu01", "walberu01", "walberu01", "walberu01", "walberu01", "walberu01", "walberu01", "walberu01", "walberu01",
+#> "branded01", "branded01", "branded01", "branded01", "branded01", "branded01", "branded01", "branded01", "branded01", "branded01", "branded01", "derripa01", "derripa01", "derripa01", "derripa01", "derripa01", "derripa01", "derripa01", "derripa01", "derripa01", "derripa01", "derripa01", "derripa01", "derripa01", "derripa01", "derripa01", "derripa01", "fitzsfr01", "fitzsfr01", "fitzsfr01", "fitzsfr01", "fitzsfr01", "fitzsfr01", "fitzsfr01", "fitzsfr01", "fitzsfr01", "fitzsfr01", "fitzsfr01", "fitzsfr01",
+#> "fitzsfr01", "fitzsfr01", "fitzsfr01", "fitzsfr01", "fitzsfr01", "fitzsfr01", "fitzsfr01", "fitzsfr01", "kleinch01", "kleinch01", "kleinch01", "kleinch01", "kleinch01", "kleinch01", "kleinch01", "kleinch01", "kleinch01", "kleinch01", "kleinch01", "kleinch01", "kleinch01", "kleinch01", "kleinch01", "kleinch01", "kleinch01", "kleinch01", "kleinch01", "gomezle01", "gomezle01", "gomezle01", "gomezle01", "gomezle01", "gomezle01", "gomezle01", "gomezle01", "gomezle01", "gomezle01", "gomezle01", "gomezle01",
+#> "gomezle01", "gomezle01", "warnelo01", "warnelo01", "warnelo01", "warnelo01", "warnelo01", "warnelo01", "warnelo01", "warnelo01", "warnelo01", "warnelo01", "warnelo01", "warnelo01", "warnelo01", "warnelo01", "warnelo01", "warnelo01", "hermabi01", "hermabi01", "hermabi01", "hermabi01", "hermabi01", "hermabi01", "hermabi01", "hermabi01", "hermabi01", "hermabi01", "hermabi01", "hermabi01", "hermabi01", "hermabi01", "hermabi01", "hermabi01", "hermabi01", "clarkwa02", "clarkwa02", "clarkwa02", "clarkwa02",
+#> "clarkwa02", "clarkwa02", "clarkwa02", "clarkwa02", "clarkwa02", "clarkwa02", "clarkwa02", "clarkwa02", "clarkwa02", "clarkwa02", "deandi01", "deandi01", "deandi01", "deandi01", "deandi01", "deandi01", "deandi01", "deandi01", "deandi01", "deandi01", "deandi01", "deandi01", "bartedi01", "bartedi01", "bartedi01", "bartedi01", "bartedi01", "bartedi01", "bartedi01", "bartedi01", "bartedi01", "bartedi01", "bartedi01", "bartedi01", "bartedi01", "bartedi01", "bartedi01", "bartedi01", "bartedi01", "bartedi01",
+#> "bartedi01", "dickebi01", "dickebi01", "dickebi01", "dickebi01", "dickebi01", "dickebi01", "dickebi01", "dickebi01", "dickebi01", "dickebi01", "dickebi01", "dickebi01", "dickebi01", "dickebi01", "dickebi01", "dickebi01", "dickebi01", "higgipi01", "higgipi01", "higgipi01", "higgipi01", "higgipi01", "higgipi01", "higgipi01", "higgipi01", "higgipi01", "higgipi01", "higgipi01", "higgipi01", "higgipi01", "higgipi01", "higgipi01", "westsa01", "westsa01", "westsa01", "westsa01", "westsa01", "westsa01",
+#> "westsa01", "westsa01", "westsa01", "westsa01", "westsa01", "westsa01", "westsa01", "westsa01", "westsa01", "westsa01", "westsa01", "whiteea01", "whiteea01", "whiteea01", "whiteea01", "whiteea01", "whiteea01", "whiteea01", "whiteea01", "whiteea01", "whiteea01", "whiteea01", "whiteea01", "whiteea01", "whiteea01", "whiteea01", "whiteea01", "whiteea01", "bridgto01", "bridgto01", "bridgto01", "bridgto01", "bridgto01", "bridgto01", "bridgto01", "bridgto01", "bridgto01", "bridgto01", "bridgto01", "bridgto01",
+#> "bridgto01", "bridgto01", "bridgto01", "bridgto01", "bergewa01", "bergewa01", "bergewa01", "bergewa01", "bergewa01", "bergewa01", "bergewa01", "bergewa01", "bergewa01", "bergewa01", "bergewa01", "bergewa01", "bergewa01", "bergewa01", "lopezal01", "lopezal01", "lopezal01", "lopezal01", "lopezal01", "lopezal01", "lopezal01", "lopezal01", "lopezal01", "lopezal01", "lopezal01", "lopezal01", "lopezal01", "lopezal01", "lopezal01", "lopezal01", "lopezal01", "lopezal01", "lopezal01", "lopezal01", "medwijo01",
+#> "medwijo01", "medwijo01", "medwijo01", "medwijo01", "medwijo01", "medwijo01", "medwijo01", "medwijo01", "medwijo01", "medwijo01", "medwijo01", "medwijo01", "medwijo01", "medwijo01", "medwijo01", "medwijo01", "medwijo01", "medwijo01", "medwijo01", "cantwbe01", "cantwbe01", "cantwbe01", "cantwbe01", "cantwbe01", "cantwbe01", "cantwbe01", "cantwbe01", "cantwbe01", "cantwbe01", "cantwbe01", "cantwbe01", "cantwbe01", "vaughar01", "vaughar01", "vaughar01", "vaughar01", "vaughar01", "vaughar01", "vaughar01",
+#> "vaughar01", "vaughar01", "vaughar01", "vaughar01", "vaughar01", "vaughar01", "vaughar01", "werbebi01", "werbebi01", "werbebi01", "werbebi01", "werbebi01", "werbebi01", "werbebi01", "werbebi01", "werbebi01", "werbebi01", "werbebi01", "werbebi01", "rowesc01", "rowesc01", "rowesc01", "rowesc01", "rowesc01", "rowesc01", "rowesc01", "rowesc01", "rowesc01", "rowesc01", "rowesc01", "rowesc01", "rowesc01", "rowesc01", "rowesc01", "rowesc01", "hardeme01", "hardeme01", "hardeme01", "hardeme01", "hardeme01",
+#> "hardeme01", "hardeme01", "hardeme01", "hardeme01", "hardeme01", "hardeme01", "hardeme01", "hardeme01", "hardeme01", "hardeme01", "hardeme01", "hardeme01", "hardeme01", "hardeme01", "hardeme01", "knickbi01", "knickbi01", "knickbi01", "knickbi01", "knickbi01", "knickbi01", "knickbi01", "knickbi01", "knickbi01", "knickbi01", "ottme01", "ottme01", "ottme01", "ottme01", "ottme01", "ottme01", "ottme01", "ottme01", "ottme01", "ottme01", "ottme01", "ottme01", "ottme01", "ottme01", "ottme01", "ottme01",
+#> "ottme01", "ottme01", "ottme01", "ottme01", "ottme01", "ottme01", "moorejo02", "moorejo02", "moorejo02", "moorejo02", "moorejo02", "moorejo02", "moorejo02", "moorejo02", "moorejo02", "moorejo02", "moorejo02", "moorejo02", "schumha02", "schumha02", "schumha02", "schumha02", "schumha02", "schumha02", "schumha02", "schumha02", "schumha02", "schumha02", "schumha02", "schumha02", "schumha02", "greenha01", "greenha01", "greenha01", "greenha01", "greenha01", "greenha01", "greenha01", "greenha01", "greenha01",
+#> "greenha01", "greenha01", "greenha01", "greenha01", "cramedo01", "cramedo01", "cramedo01", "cramedo01", "cramedo01", "cramedo01", "cramedo01", "cramedo01", "cramedo01", "cramedo01", "cramedo01", "cramedo01", "cramedo01", "cramedo01", "cramedo01", "cramedo01", "cramedo01", "cramedo01", "cramedo01", "cramedo01", "vosmijo01", "vosmijo01", "vosmijo01", "vosmijo01", "vosmijo01", "vosmijo01", "vosmijo01", "vosmijo01", "vosmijo01", "vosmijo01", "vosmijo01", "vosmijo01", "vosmijo01", "foxpe01", "foxpe01",
+#> "foxpe01", "foxpe01", "foxpe01", "foxpe01", "foxpe01", "foxpe01", "foxpe01", "foxpe01", "foxpe01", "foxpe01", "foxpe01", "martipe01", "martipe01", "martipe01", "martipe01", "martipe01", "martipe01", "martipe01", "martipe01", "martipe01", "martipe01", "martipe01", "martipe01", "martipe01", "owenma01", "owenma01", "owenma01", "owenma01", "owenma01", "owenma01", "owenma01", "owenma01", "owenma01", "dimagjo01", "dimagjo01", "dimagjo01", "dimagjo01", "dimagjo01", "dimagjo01", "dimagjo01", "dimagjo01",
+#> "dimagjo01", "dimagjo01", "dimagjo01", "dimagjo01", "dimagjo01", "kenneve01", "kenneve01", "kenneve01", "kenneve01", "kenneve01", "kenneve01", "kenneve01", "kenneve01", "kenneve01", "kenneve01", "kenneve01", "kenneve01", "kenneve01", "kenneve01", "kenneve01", "kenneve01", "allenjo02", "allenjo02", "allenjo02", "allenjo02", "allenjo02", "allenjo02", "allenjo02", "allenjo02", "allenjo02", "allenjo02", "allenjo02", "allenjo02", "allenjo02", "allenjo02", "allenjo02", "moseswa01", "moseswa01", "moseswa01",
+#> "moseswa01", "moseswa01", "moseswa01", "moseswa01", "moseswa01", "moseswa01", "moseswa01", "moseswa01", "moseswa01", "moseswa01", "moseswa01", "moseswa01", "moseswa01", "moseswa01", "moseswa01", "applilu01", "applilu01", "applilu01", "applilu01", "applilu01", "applilu01", "applilu01", "applilu01", "applilu01", "applilu01", "applilu01", "applilu01", "applilu01", "applilu01", "applilu01", "applilu01", "applilu01", "applilu01", "applilu01", "applilu01", "hackst01", "hackst01", "hackst01", "hackst01",
+#> "hackst01", "hackst01", "hackst01", "hackst01", "hackst01", "hackst01", "hackst01", "hackst01", "hackst01", "hackst01", "hackst01", "hackst01", "suhrgu01", "suhrgu01", "suhrgu01", "suhrgu01", "suhrgu01", "suhrgu01", "suhrgu01", "suhrgu01", "suhrgu01", "suhrgu01", "suhrgu01", "suhrgu01", "frencla01", "frencla01", "frencla01", "frencla01", "frencla01", "frencla01", "frencla01", "frencla01", "frencla01", "frencla01", "frencla01", "frencla01", "frencla01", "frencla01", "frencla01", "macfada01", "macfada01",
+#> "macfada01", "macfada01", "macfada01", "macfada01", "macfada01", "macfada01", "macfada01", "macfada01", "macfada01", "macfada01", "macfada01", "macfada01", "macfada01", "macfada01", "macfada01", "macfada01", "macfada01", "lawsoro01", "lawsoro01", "lawsoro01", "lawsoro01", "lawsoro01", "lawsoro01", "lawsoro01", "lawsoro01", "lawsoro01", "lawsoro01", "whitnpi01", "whitnpi01", "whitnpi01", "whitnpi01", "whitnpi01", "whitnpi01", "whitnpi01", "whitnpi01", "whitnpi01", "whitnpi01", "whitnpi01", "whitnpi01",
+#> "whitnpi01", "whitnpi01", "fettelo01", "fettelo01", "fettelo01", "fettelo01", "fettelo01", "fettelo01", "mizejo01", "mizejo01", "mizejo01", "mizejo01", "mizejo01", "mizejo01", "mizejo01", "mizejo01", "mizejo01", "mizejo01", "mizejo01", "mizejo01", "mizejo01", "mizejo01", "mizejo01", "mizejo01", "demarfr02", "demarfr02", "demarfr02", "demarfr02", "demarfr02", "demarfr02", "demarfr02", "demarfr02", "demarfr02", "demarfr02", "demarfr02", "demarfr02", "demarfr02", "turneji01", "turneji01", "turneji01",
+#> "turneji01", "turneji01", "turneji01", "turneji01", "turneji01", "turneji01", "turneji01", "rolfere01", "rolfere01", "rolfere01", "rolfere01", "rolfere01", "rolfere01", "rolfere01", "rolfere01", "rolfere01", "rolfere01", "ruffire01", "ruffire01", "ruffire01", "ruffire01", "ruffire01", "ruffire01", "ruffire01", "ruffire01", "ruffire01", "ruffire01", "ruffire01", "ruffire01", "ruffire01", "ruffire01", "ruffire01", "ruffire01", "ruffire01", "ruffire01", "ruffire01", "ruffire01", "ruffire01", "ruffire01",
+#> "ruffire01", "hemslro01", "hemslro01", "hemslro01", "hemslro01", "hemslro01", "hemslro01", "hemslro01", "hemslro01", "hemslro01", "hemslro01", "hemslro01", "hemslro01", "hemslro01", "hemslro01", "hemslro01", "hemslro01", "hemslro01", "hemslro01", "hemslro01", "hemslro01", "hemslro01", "hemslro01", "heathje01", "heathje01", "heathje01", "heathje01", "heathje01", "heathje01", "heathje01", "heathje01", "heathje01", "heathje01", "heathje01", "heathje01", "heathje01", "heathje01", "heathje01", "newsobo01",
+#> "newsobo01", "newsobo01", "newsobo01", "newsobo01", "newsobo01", "newsobo01", "newsobo01", "newsobo01", "newsobo01", "newsobo01", "newsobo01", "newsobo01", "newsobo01", "newsobo01", "newsobo01", "newsobo01", "newsobo01", "newsobo01", "newsobo01", "newsobo01", "newsobo01", "newsobo01", "newsobo01", "newsobo01", "newsobo01", "newsobo01", "newsobo01", "newsobo01", "vandejo01", "vandejo01", "vandejo01", "vandejo01", "vandejo01", "vandejo01", "vandejo01", "vandejo01", "vandejo01", "vandejo01", "vandejo01",
+#> "vandejo01", "vandejo01", "mccorfr01", "mccorfr01", "mccorfr01", "mccorfr01", "mccorfr01", "mccorfr01", "mccorfr01", "mccorfr01", "mccorfr01", "mccorfr01", "mccorfr01", "mccorfr01", "mccorfr01", "mccorfr01", "lombaer01", "lombaer01", "lombaer01", "lombaer01", "lombaer01", "lombaer01", "lombaer01", "lombaer01", "lombaer01", "lombaer01", "lombaer01", "lombaer01", "lombaer01", "lombaer01", "lombaer01", "lombaer01", "lombaer01", "danniha01", "danniha01", "danniha01", "danniha01", "danniha01", "danniha01",
+#> "danniha01", "danniha01", "danniha01", "danniha01", "leebi02", "leebi02", "leebi02", "leebi02", "leebi02", "leebi02", "leebi02", "leebi02", "leebi02", "leebi02", "leebi02", "leebi02", "leebi02", "leebi02", "leebi02", "leebi02", "goodmiv01", "goodmiv01", "goodmiv01", "goodmiv01", "goodmiv01", "goodmiv01", "goodmiv01", "goodmiv01", "goodmiv01", "goodmiv01", "gordojo01", "gordojo01", "gordojo01", "gordojo01", "gordojo01", "gordojo01", "gordojo01", "gordojo01", "gordojo01", "gordojo01", "gordojo01",
+#> "johnsbo01", "johnsbo01", "johnsbo01", "johnsbo01", "johnsbo01", "johnsbo01", "johnsbo01", "johnsbo01", "johnsbo01", "johnsbo01", "johnsbo01", "johnsbo01", "johnsbo01", "fellebo01", "fellebo01", "fellebo01", "fellebo01", "fellebo01", "fellebo01", "fellebo01", "fellebo01", "fellebo01", "fellebo01", "fellebo01", "fellebo01", "fellebo01", "fellebo01", "fellebo01", "fellebo01", "fellebo01", "fellebo01", "leonadu02", "leonadu02", "leonadu02", "leonadu02", "leonadu02", "leonadu02", "leonadu02", "leonadu02",
+#> "leonadu02", "leonadu02", "leonadu02", "leonadu02", "leonadu02", "leonadu02", "leonadu02", "leonadu02", "leonadu02", "leonadu02", "leonadu02", "leonadu02", "willite01", "willite01", "willite01", "willite01", "willite01", "willite01", "willite01", "willite01", "willite01", "willite01", "willite01", "willite01", "willite01", "willite01", "willite01", "willite01", "willite01", "willite01", "willite01", "waltebu01", "waltebu01", "waltebu01", "waltebu01", "waltebu01", "waltebu01", "waltebu01", "waltebu01",
+#> "waltebu01", "waltebu01", "waltebu01", "waltebu01", "waltebu01", "waltebu01", "waltebu01", "waltebu01", "waltebu01", "waltebu01", "waltebu01", "waltebu01", "waltebu01", "daviscu01", "daviscu01", "daviscu01", "daviscu01", "daviscu01", "daviscu01", "daviscu01", "daviscu01", "daviscu01", "daviscu01", "daviscu01", "daviscu01", "daviscu01", "daviscu01", "daviscu01", "freylo01", "freylo01", "freylo01", "freylo01", "freylo01", "freylo01", "freylo01", "freylo01", "freylo01", "freylo01", "freylo01", "freylo01",
+#> "freylo01", "freylo01", "freylo01", "freylo01", "lavagco01", "lavagco01", "lavagco01", "lavagco01", "lavagco01", "lavagco01", "lavagco01", "lavagco01", "lavagco01", "lavagco01", "leibeha01", "leibeha01", "leibeha01", "leibeha01", "leibeha01", "leibeha01", "leibeha01", "leibeha01", "leibeha01", "leibeha01", "cliftha01", "cliftha01", "cliftha01", "cliftha01", "cliftha01", "cliftha01", "cliftha01", "cliftha01", "cliftha01", "cliftha01", "cliftha01", "cliftha01", "cliftha01", "hayesfr01", "hayesfr01",
+#> "hayesfr01", "hayesfr01", "hayesfr01", "hayesfr01", "hayesfr01", "hayesfr01", "hayesfr01", "hayesfr01", "hayesfr01", "hayesfr01", "hayesfr01", "hayesfr01", "hayesfr01", "hayesfr01", "hayesfr01", "kellech01", "kellech01", "kellech01", "kellech01", "kellech01", "kellech01", "kellech01", "kellech01", "kellech01", "kellech01", "kellech01", "kellech01", "kellech01", "nichobi01", "nichobi01", "nichobi01", "nichobi01", "nichobi01", "nichobi01", "nichobi01", "nichobi01", "nichobi01", "nichobi01", "nichobi01",
+#> "nichobi01", "nichobi01", "nichobi01", "nichobi01", "nichobi01", "milleed03", "milleed03", "milleed03", "milleed03", "milleed03", "milleed03", "milleed03", "milleed03", "milleed03", "milleed03", "milleed03", "milleed03", "milleed03", "milleed03", "taborji01", "taborji01", "taborji01", "taborji01", "taborji01", "taborji01", "taborji01", "taborji01", "taborji01", "leeth01", "leeth01", "leeth01", "leeth01", "leeth01", "leeth01", "leeth01", "leeth01", "leeth01", "leeth01", "leeth01", "leeth01", "leeth01",
+#> "leeth01", "leeth01", "leeth01", "newsodi01", "newsodi01", "newsodi01", "travice01", "travice01", "travice01", "travice01", "travice01", "travice01", "travice01", "travice01", "travice01", "travice01", "travice01", "travice01", "camildo01", "camildo01", "camildo01", "camildo01", "camildo01", "camildo01", "camildo01", "camildo01", "camildo01", "camildo01", "camildo01", "camildo01", "camildo01", "brownji03", "brownji03", "brownji03", "brownji03", "brownji03", "brownji03", "brownji03", "brownji03",
+#> "wyattwh01", "wyattwh01", "wyattwh01", "wyattwh01", "wyattwh01", "wyattwh01", "wyattwh01", "wyattwh01", "wyattwh01", "wyattwh01", "wyattwh01", "wyattwh01", "wyattwh01", "wyattwh01", "wyattwh01", "wyattwh01", "wyattwh01", "whiteer01", "whiteer01", "whiteer01", "whiteer01", "whiteer01", "whiteer01", "whiteer01", "riddlel01", "riddlel01", "riddlel01", "riddlel01", "riddlel01", "riddlel01", "riddlel01", "riddlel01", "riddlel01", "riddlel01", "crespcr01", "crespcr01", "crespcr01", "crespcr01", "crespcr01",
+#> "reisepe01", "reisepe01", "reisepe01", "reisepe01", "reisepe01", "reisepe01", "reisepe01", "reisepe01", "reisepe01", "reisepe01", "higbeki01", "higbeki01", "higbeki01", "higbeki01", "higbeki01", "higbeki01", "higbeki01", "higbeki01", "higbeki01", "higbeki01", "higbeki01", "higbeki01", "higbeki01", "higbeki01", "higbeki01", "slaugen01", "slaugen01", "slaugen01", "slaugen01", "slaugen01", "slaugen01", "slaugen01", "slaugen01", "slaugen01", "slaugen01", "slaugen01", "slaugen01", "slaugen01", "slaugen01",
+#> "slaugen01", "slaugen01", "slaugen01", "slaugen01", "slaugen01", "slaugen01", "slaugen01", "slaugen01", "jurgebi01", "jurgebi01", "jurgebi01", "jurgebi01", "jurgebi01", "jurgebi01", "jurgebi01", "jurgebi01", "jurgebi01", "jurgebi01", "jurgebi01", "jurgebi01", "jurgebi01", "jurgebi01", "jurgebi01", "jurgebi01", "jurgebi01", "hassebu01", "hassebu01", "hassebu01", "hassebu01", "hassebu01", "hassebu01", "hassebu01", "keltnke01", "keltnke01", "keltnke01", "keltnke01", "keltnke01", "keltnke01", "keltnke01",
+#> "keltnke01", "keltnke01", "keltnke01", "keltnke01", "keltnke01", "keltnke01", "hughste01", "hughste01", "hughste01", "hughste01", "hughste01", "hughste01", "hughste01", "hughste01", "bonhati01", "bonhati01", "bonhati01", "bonhati01", "bonhati01", "bonhati01", "bonhati01", "bonhati01", "bonhati01", "bonhati01", "bagbyji02", "bagbyji02", "bagbyji02", "bagbyji02", "bagbyji02", "bagbyji02", "bagbyji02", "bagbyji02", "bagbyji02", "bagbyji02", "marchph01", "marchph01", "marchph01", "marchph01", "marchph01",
+#> "marchph01", "marchph01", "marchph01", "marchph01", "chandsp01", "chandsp01", "chandsp01", "chandsp01", "chandsp01", "chandsp01", "chandsp01", "chandsp01", "chandsp01", "chandsp01", "chandsp01", "spencst01", "spencst01", "spencst01", "spencst01", "spencst01", "spencst01", "spencst01", "spencst01", "spencst01", "spencst01", "stephve01", "stephve01", "stephve01", "stephve01", "stephve01", "stephve01", "stephve01", "stephve01", "stephve01", "stephve01", "stephve01", "stephve01", "stephve01", "stephve01",
+#> "stephve01", "stephve01", "stephve01", "coopemo01", "coopemo01", "coopemo01", "coopemo01", "coopemo01", "coopemo01", "coopemo01", "coopemo01", "coopemo01", "coopemo01", "coopemo01", "coopemo01", "coopemo01", "hugheto04", "hugheto04", "hugheto04", "hugheto04", "hugheto04", "beazljo01", "beazljo01", "beazljo01", "beazljo01", "beazljo01", "beazljo01", "marioma01", "marioma01", "marioma01", "marioma01", "marioma01", "marioma01", "marioma01", "marioma01", "marioma01", "marioma01", "marioma01", "marioma01",
+#> "marioma01", "owenmi01", "owenmi01", "owenmi01", "owenmi01", "owenmi01", "owenmi01", "owenmi01", "owenmi01", "owenmi01", "owenmi01", "owenmi01", "owenmi01", "owenmi01", "peskyjo01", "peskyjo01", "peskyjo01", "peskyjo01", "peskyjo01", "peskyjo01", "peskyjo01", "peskyjo01", "peskyjo01", "peskyjo01", "peskyjo01", "peskyjo01", "yorkru01", "yorkru01", "yorkru01", "yorkru01", "yorkru01", "yorkru01", "yorkru01", "yorkru01", "yorkru01", "yorkru01", "yorkru01", "yorkru01", "yorkru01", "yorkru01", "johnsbi03",
+#> "johnsbi03", "johnsbi03", "johnsbi03", "johnsbi03", "johnsbi03", "johnsbi03", "johnsbi03", "johnsbi03", "johnsbi03", "troutdi01", "troutdi01", "troutdi01", "troutdi01", "troutdi01", "troutdi01", "troutdi01", "troutdi01", "troutdi01", "troutdi01", "troutdi01", "troutdi01", "troutdi01", "troutdi01", "troutdi01", "troutdi01", "smithal03", "smithal03", "smithal03", "smithal03", "smithal03", "smithal03", "smithal03", "smithal03", "smithal03", "smithal03", "smithal03", "smithal03", "wakefdi01", "wakefdi01",
+#> "wakefdi01", "wakefdi01", "wakefdi01", "wakefdi01", "wakefdi01", "wakefdi01", "wakefdi01", "musiast01", "musiast01", "musiast01", "musiast01", "musiast01", "musiast01", "musiast01", "musiast01", "musiast01", "musiast01", "musiast01", "musiast01", "musiast01", "musiast01", "musiast01", "musiast01", "musiast01", "musiast01", "musiast01", "musiast01", "musiast01", "musiast01", "sewelri01", "sewelri01", "sewelri01", "sewelri01", "sewelri01", "sewelri01", "sewelri01", "sewelri01", "sewelri01", "sewelri01",
+#> "sewelri01", "sewelri01", "sewelri01", "coopewa01", "coopewa01", "coopewa01", "coopewa01", "coopewa01", "coopewa01", "coopewa01", "coopewa01", "coopewa01", "coopewa01", "coopewa01", "coopewa01", "coopewa01", "coopewa01", "coopewa01", "coopewa01", "coopewa01", "coopewa01", "coopewa01", "coopewa01", "coopewa01", "dimagvi01", "dimagvi01", "dimagvi01", "dimagvi01", "dimagvi01", "dimagvi01", "dimagvi01", "dimagvi01", "dimagvi01", "dimagvi01", "dimagvi01", "dimagvi01", "stirnsn01", "stirnsn01", "stirnsn01",
+#> "stirnsn01", "stirnsn01", "stirnsn01", "stirnsn01", "stirnsn01", "stirnsn01", "stirnsn01", "stirnsn01", "newhoha01", "newhoha01", "newhoha01", "newhoha01", "newhoha01", "newhoha01", "newhoha01", "newhoha01", "newhoha01", "newhoha01", "newhoha01", "newhoha01", "newhoha01", "newhoha01", "newhoha01", "newhoha01", "newhoha01", "elliobo01", "elliobo01", "elliobo01", "elliobo01", "elliobo01", "elliobo01", "elliobo01", "elliobo01", "elliobo01", "elliobo01", "elliobo01", "elliobo01", "elliobo01", "elliobo01",
+#> "elliobo01", "elliobo01", "sandera01", "sandera01", "sandera01", "sandera01", "sandera01", "sandera01", "sandera01", "verbaem01", "verbaem01", "verbaem01", "verbaem01", "verbaem01", "verbaem01", "verbaem01", "verbaem01", "verbaem01", "verbaem01", "voisebi01", "voisebi01", "voisebi01", "voisebi01", "voisebi01", "voisebi01", "voisebi01", "voisebi01", "voisebi01", "voisebi01", "doerrbo01", "doerrbo01", "doerrbo01", "doerrbo01", "doerrbo01", "doerrbo01", "doerrbo01", "doerrbo01", "doerrbo01", "doerrbo01",
+#> "doerrbo01", "doerrbo01", "doerrbo01", "doerrbo01", "walkedi02", "walkedi02", "walkedi02", "walkedi02", "walkedi02", "walkedi02", "walkedi02", "walkedi02", "walkedi02", "walkedi02", "walkedi02", "walkedi02", "walkedi02", "walkedi02", "walkedi02", "walkedi02", "walkedi02", "walkedi02", "walkedi02", "walkedi02", "ettenni01", "ettenni01", "ettenni01", "ettenni01", "ettenni01", "ettenni01", "ettenni01", "ettenni01", "ettenni01", "cuccito01", "cuccito01", "cuccito01", "cuccito01", "cuccito01", "cuccito01",
+#> "cuccito01", "cuccito01", "cuccito01", "cuccito01", "cuccito01", "cuccito01", "cuccito01", "cuccito01", "cuccito01", "cuccito01", "cuccito01", "richapa01", "richapa01", "richapa01", "richapa01", "richapa01", "richapa01", "richapa01", "richapa01", "richapa01", "ferrida01", "ferrida01", "ferrida01", "ferrida01", "ferrida01", "ferrida01", "gromest01", "gromest01", "gromest01", "gromest01", "gromest01", "gromest01", "gromest01", "gromest01", "gromest01", "gromest01", "gromest01", "gromest01", "gromest01",
+#> "gromest01", "gromest01", "gromest01", "gromest01", "gromest01", "wolffro01", "wolffro01", "wolffro01", "wolffro01", "wolffro01", "wolffro01", "wolffro01", "wolffro01", "cullero01", "cullero01", "cullero01", "cullero01", "cullero01", "cullero01", "cullero01", "cullero01", "cullero01", "cullero01", "cullero01", "cullero01", "cullero01", "cullero01", "cavarph01", "cavarph01", "cavarph01", "cavarph01", "cavarph01", "cavarph01", "cavarph01", "cavarph01", "cavarph01", "cavarph01", "cavarph01", "cavarph01",
+#> "cavarph01", "cavarph01", "cavarph01", "cavarph01", "cavarph01", "cavarph01", "cavarph01", "cavarph01", "cavarph01", "cavarph01", "kurowwh01", "kurowwh01", "kurowwh01", "kurowwh01", "kurowwh01", "kurowwh01", "kurowwh01", "kurowwh01", "kurowwh01", "pafkoan01", "pafkoan01", "pafkoan01", "pafkoan01", "pafkoan01", "pafkoan01", "pafkoan01", "pafkoan01", "pafkoan01", "pafkoan01", "pafkoan01", "pafkoan01", "pafkoan01", "pafkoan01", "pafkoan01", "pafkoan01", "pafkoan01", "pafkoan01", "brechha01", "brechha01",
+#> "brechha01", "brechha01", "brechha01", "brechha01", "brechha01", "brechha01", "brechha01", "brechha01", "brechha01", "brechha01", "borowha01", "borowha01", "borowha01", "borowha01", "borowha01", "borowha01", "borowha01", "borowha01", "borowha01", "borowha01", "borowha01", "borowha01", "borowha01", "holmeto01", "holmeto01", "holmeto01", "holmeto01", "holmeto01", "holmeto01", "holmeto01", "holmeto01", "holmeto01", "holmeto01", "holmeto01", "barrere01", "barrere01", "barrere01", "barrere01", "barrere01",
+#> "barrere01", "barrere01", "barrere01", "barrere01", "barrere01", "barrere01", "barrere01", "wyseha01", "wyseha01", "wyseha01", "wyseha01", "wyseha01", "wyseha01", "wyseha01", "wyseha01", "wyseha01", "rosengo01", "rosengo01", "rosengo01", "rosengo01", "rosengo01", "rosengo01", "rosengo01", "mayoed01", "mayoed01", "mayoed01", "mayoed01", "mayoed01", "mayoed01", "mayoed01", "mayoed01", "mayoed01", "vernomi01", "vernomi01", "vernomi01", "vernomi01", "vernomi01", "vernomi01", "vernomi01", "vernomi01",
+#> "vernomi01", "vernomi01", "vernomi01", "vernomi01", "vernomi01", "vernomi01", "vernomi01", "vernomi01", "vernomi01", "vernomi01", "vernomi01", "vernomi01", "vernomi01", "kellge01", "kellge01", "kellge01", "kellge01", "kellge01", "kellge01", "kellge01", "kellge01", "kellge01", "kellge01", "kellge01", "kellge01", "kellge01", "kellge01", "kellge01", "kellge01", "kellge01", "kellge01", "kellge01", "robinaa01", "robinaa01", "robinaa01", "robinaa01", "robinaa01", "robinaa01", "robinaa01", "robinaa01",
+#> "robinaa01", "boudrlo01", "boudrlo01", "boudrlo01", "boudrlo01", "boudrlo01", "boudrlo01", "boudrlo01", "boudrlo01", "boudrlo01", "boudrlo01", "boudrlo01", "boudrlo01", "boudrlo01", "boudrlo01", "boudrlo01", "polleho01", "polleho01", "polleho01", "polleho01", "polleho01", "polleho01", "polleho01", "polleho01", "polleho01", "polleho01", "polleho01", "polleho01", "polleho01", "polleho01", "polleho01", "polleho01", "polleho01", "stanked01", "stanked01", "stanked01", "stanked01", "stanked01", "stanked01",
+#> "stanked01", "stanked01", "stanked01", "stanked01", "stanked01", "stanked01", "mcculcl01", "mcculcl01", "mcculcl01", "mcculcl01", "mcculcl01", "mcculcl01", "mcculcl01", "mcculcl01", "mcculcl01", "mcculcl01", "mcculcl01", "mcculcl01", "mcculcl01", "mcculcl01", "mcculcl01", "ennisde01", "ennisde01", "ennisde01", "ennisde01", "ennisde01", "ennisde01", "ennisde01", "ennisde01", "ennisde01", "ennisde01", "ennisde01", "ennisde01", "ennisde01", "ennisde01", "ennisde01", "sainjo01", "sainjo01", "sainjo01",
+#> "sainjo01", "sainjo01", "sainjo01", "sainjo01", "sainjo01", "sainjo01", "sainjo01", "sainjo01", "sainjo01", "sainjo01", "reesepe01", "reesepe01", "reesepe01", "reesepe01", "reesepe01", "reesepe01", "reesepe01", "reesepe01", "reesepe01", "reesepe01", "reesepe01", "reesepe01", "reesepe01", "reesepe01", "reesepe01", "reesepe01", "dimagdo01", "dimagdo01", "dimagdo01", "dimagdo01", "dimagdo01", "dimagdo01", "dimagdo01", "dimagdo01", "dimagdo01", "dimagdo01", "dimagdo01", "mcquige02", "mcquige02", "mcquige02",
+#> "mcquige02", "mcquige02", "mcquige02", "mcquige02", "mcquige02", "mcquige02", "mcquige02", "mcquige02", "mcquige02", "berrayo01", "berrayo01", "berrayo01", "berrayo01", "berrayo01", "berrayo01", "berrayo01", "berrayo01", "berrayo01", "berrayo01", "berrayo01", "berrayo01", "berrayo01", "berrayo01", "berrayo01", "berrayo01", "berrayo01", "berrayo01", "berrayo01", "reynoal01", "reynoal01", "reynoal01", "reynoal01", "reynoal01", "reynoal01", "reynoal01", "reynoal01", "reynoal01", "reynoal01", "reynoal01",
+#> "reynoal01", "reynoal01", "henrito01", "henrito01", "henrito01", "henrito01", "henrito01", "henrito01", "henrito01", "henrito01", "henrito01", "henrito01", "henrito01", "edwarbr01", "edwarbr01", "edwarbr01", "edwarbr01", "edwarbr01", "edwarbr01", "edwarbr01", "edwarbr01", "edwarbr01", "edwarbr01", "edwarbr01", "blackew01", "blackew01", "blackew01", "blackew01", "blackew01", "blackew01", "blackew01", "blackew01", "blackew01", "blackew01", "blackew01", "kinerra01", "kinerra01", "kinerra01", "kinerra01",
+#> "kinerra01", "kinerra01", "kinerra01", "kinerra01", "kinerra01", "kinerra01", "kinerra01", "brancra01", "brancra01", "brancra01", "brancra01", "brancra01", "brancra01", "brancra01", "brancra01", "brancra01", "brancra01", "brancra01", "brancra01", "brancra01", "brancra01", "spahnwa01", "spahnwa01", "spahnwa01", "spahnwa01", "spahnwa01", "spahnwa01", "spahnwa01", "spahnwa01", "spahnwa01", "spahnwa01", "spahnwa01", "spahnwa01", "spahnwa01", "spahnwa01", "spahnwa01", "spahnwa01", "spahnwa01", "spahnwa01",
+#> "spahnwa01", "spahnwa01", "spahnwa01", "spahnwa01", "marshwi01", "marshwi01", "marshwi01", "marshwi01", "marshwi01", "marshwi01", "marshwi01", "marshwi01", "marshwi01", "marshwi01", "marshwi01", "marshwi01", "robinja02", "robinja02", "robinja02", "robinja02", "robinja02", "robinja02", "robinja02", "robinja02", "robinja02", "robinja02", "fainfe01", "fainfe01", "fainfe01", "fainfe01", "fainfe01", "fainfe01", "fainfe01", "fainfe01", "fainfe01", "fainfe01", "tebbebi01", "tebbebi01", "tebbebi01", "tebbebi01",
+#> "tebbebi01", "tebbebi01", "tebbebi01", "tebbebi01", "tebbebi01", "tebbebi01", "tebbebi01", "tebbebi01", "tebbebi01", "tebbebi01", "tebbebi01", "lemonbo01", "lemonbo01", "lemonbo01", "lemonbo01", "lemonbo01", "lemonbo01", "lemonbo01", "lemonbo01", "lemonbo01", "lemonbo01", "lemonbo01", "lemonbo01", "lemonbo01", "lemonbo01", "lemonbo01", "raschvi01", "raschvi01", "raschvi01", "raschvi01", "raschvi01", "raschvi01", "raschvi01", "raschvi01", "raschvi01", "raschvi01", "raschvi01", "masiph01", "masiph01",
+#> "masiph01", "masiph01", "masiph01", "masiph01", "masiph01", "masiph01", "masiph01", "masiph01", "masiph01", "masiph01", "masiph01", "masiph01", "masiph01", "schmijo01", "schmijo01", "schmijo01", "schmijo01", "schmijo01", "schmijo01", "schmijo01", "schmijo01", "schmijo01", "schmijo01", "schmijo01", "schmijo01", "schmijo01", "schmijo01", "schmijo01", "schmijo01", "schmijo01", "schmijo01", "darkal01", "darkal01", "darkal01", "darkal01", "darkal01", "darkal01", "darkal01", "darkal01", "darkal01", "darkal01",
+#> "darkal01", "darkal01", "darkal01", "darkal01", "darkal01", "darkal01", "darkal01", "pagejo01", "pagejo01", "pagejo01", "pagejo01", "pagejo01", "pagejo01", "pagejo01", "pagejo01", "michaca01", "michaca01", "michaca01", "michaca01", "michaca01", "michaca01", "michaca01", "michaca01", "michaca01", "michaca01", "michaca01", "michaca01", "michaca01", "michaca01", "michaca01", "parneme01", "parneme01", "parneme01", "parneme01", "parneme01", "parneme01", "parneme01", "parneme01", "parneme01", "parneme01",
+#> "wertzvi01", "wertzvi01", "wertzvi01", "wertzvi01", "wertzvi01", "wertzvi01", "wertzvi01", "wertzvi01", "wertzvi01", "wertzvi01", "wertzvi01", "wertzvi01", "wertzvi01", "wertzvi01", "wertzvi01", "wertzvi01", "wertzvi01", "wertzvi01", "wertzvi01", "wertzvi01", "wertzvi01", "hodgegi01", "hodgegi01", "hodgegi01", "hodgegi01", "hodgegi01", "hodgegi01", "hodgegi01", "hodgegi01", "hodgegi01", "hodgegi01", "hodgegi01", "hodgegi01", "hodgegi01", "hodgegi01", "hodgegi01", "hodgegi01", "hodgegi01", "hodgegi01",
+#> "gordosi01", "gordosi01", "gordosi01", "gordosi01", "gordosi01", "gordosi01", "gordosi01", "gordosi01", "gordosi01", "gordosi01", "gordosi01", "gordosi01", "gordosi01", "gordosi01", "camparo01", "camparo01", "camparo01", "camparo01", "camparo01", "camparo01", "camparo01", "camparo01", "camparo01", "camparo01", "newcodo01", "newcodo01", "newcodo01", "newcodo01", "newcodo01", "newcodo01", "newcodo01", "newcodo01", "newcodo01", "newcodo01", "newcodo01", "newcodo01", "sievero01", "sievero01", "sievero01",
+#> "sievero01", "sievero01", "sievero01", "sievero01", "sievero01", "sievero01", "sievero01", "sievero01", "sievero01", "sievero01", "sievero01", "sievero01", "sievero01", "sievero01", "sievero01", "kindeel01", "kindeel01", "kindeel01", "kindeel01", "kindeel01", "kindeel01", "kindeel01", "kindeel01", "kindeel01", "kindeel01", "kindeel01", "kindeel01", "kindeel01", "rizzuph01", "rizzuph01", "rizzuph01", "rizzuph01", "rizzuph01", "rizzuph01", "rizzuph01", "rizzuph01", "rizzuph01", "rizzuph01", "rizzuph01",
+#> "rizzuph01", "rizzuph01", "colemje01", "colemje01", "colemje01", "colemje01", "colemje01", "colemje01", "colemje01", "colemje01", "colemje01", "dropowa01", "dropowa01", "dropowa01", "dropowa01", "dropowa01", "dropowa01", "dropowa01", "dropowa01", "dropowa01", "dropowa01", "dropowa01", "dropowa01", "dropowa01", "dropowa01", "dropowa01", "dropowa01", "houttar01", "houttar01", "houttar01", "houttar01", "houttar01", "houttar01", "houttar01", "houttar01", "houttar01", "houttar01", "houttar01", "houttar01",
+#> "houttar01", "houttar01", "konstji01", "konstji01", "konstji01", "konstji01", "konstji01", "konstji01", "konstji01", "konstji01", "konstji01", "konstji01", "konstji01", "konstji01", "konstji01", "furilca01", "furilca01", "furilca01", "furilca01", "furilca01", "furilca01", "furilca01", "furilca01", "furilca01", "furilca01", "furilca01", "furilca01", "furilca01", "furilca01", "furilca01", "snidedu01", "snidedu01", "snidedu01", "snidedu01", "snidedu01", "snidedu01", "snidedu01", "snidedu01", "snidedu01",
+#> "snidedu01", "snidedu01", "snidedu01", "snidedu01", "snidedu01", "snidedu01", "snidedu01", "snidedu01", "snidedu01", "jansela01", "jansela01", "jansela01", "jansela01", "jansela01", "jansela01", "jansela01", "jansela01", "jansela01", "hamnegr01", "hamnegr01", "hamnegr01", "hamnegr01", "hamnegr01", "hamnegr01", "hamnegr01", "hamnegr01", "hamnegr01", "hamnegr01", "hamnegr01", "hamnegr01", "hamnegr01", "hamnegr01", "hamnegr01", "hamnegr01", "hamnegr01", "hamnegr01", "jethrsa01", "jethrsa01", "jethrsa01",
+#> "jethrsa01", "dobyla01", "dobyla01", "dobyla01", "dobyla01", "dobyla01", "dobyla01", "dobyla01", "dobyla01", "dobyla01", "dobyla01", "dobyla01", "dobyla01", "dobyla01", "dobyla01", "mcdougi01", "mcdougi01", "mcdougi01", "mcdougi01", "mcdougi01", "mcdougi01", "mcdougi01", "mcdougi01", "mcdougi01", "mcdougi01", "mayswi01", "mayswi01", "mayswi01", "mayswi01", "mayswi01", "mayswi01", "mayswi01", "mayswi01", "mayswi01", "mayswi01", "mayswi01", "mayswi01", "mayswi01", "mayswi01", "mayswi01", "mayswi01",
+#> "mayswi01", "mayswi01", "mayswi01", "mayswi01", "mayswi01", "mayswi01", "mayswi01", "maglisa01", "maglisa01", "maglisa01", "maglisa01", "maglisa01", "maglisa01", "maglisa01", "maglisa01", "maglisa01", "maglisa01", "maglisa01", "maglisa01", "maglisa01", "maglisa01", "roepr01", "roepr01", "roepr01", "roepr01", "roepr01", "roepr01", "roepr01", "roepr01", "roepr01", "roepr01", "roepr01", "roepr01", "shantbo01", "shantbo01", "shantbo01", "shantbo01", "shantbo01", "shantbo01", "shantbo01", "shantbo01",
+#> "shantbo01", "shantbo01", "shantbo01", "shantbo01", "shantbo01", "shantbo01", "shantbo01", "shantbo01", "shantbo01", "shantbo01", "shantbo01", "sauerha01", "sauerha01", "sauerha01", "sauerha01", "sauerha01", "sauerha01", "sauerha01", "sauerha01", "sauerha01", "sauerha01", "sauerha01", "sauerha01", "sauerha01", "sauerha01", "sauerha01", "sauerha01", "byrdha01", "byrdha01", "byrdha01", "byrdha01", "byrdha01", "byrdha01", "byrdha01", "byrdha01", "blackjo02", "blackjo02", "blackjo02", "blackjo02", "blackjo02",
+#> "blackjo02", "blackjo02", "mantlmi01", "mantlmi01", "mantlmi01", "mantlmi01", "mantlmi01", "mantlmi01", "mantlmi01", "mantlmi01", "mantlmi01", "mantlmi01", "mantlmi01", "mantlmi01", "mantlmi01", "mantlmi01", "mantlmi01", "mantlmi01", "mantlmi01", "mantlmi01", "roberro01", "roberro01", "roberro01", "roberro01", "roberro01", "roberro01", "roberro01", "roberro01", "roberro01", "roberro01", "roberro01", "roberro01", "roberro01", "roberro01", "roberro01", "roberro01", "roberro01", "roberro01", "roberro01",
+#> "roberro01", "roberro01", "eastelu01", "eastelu01", "eastelu01", "eastelu01", "eastelu01", "eastelu01", "martibi02", "martibi02", "martibi02", "martibi02", "martibi02", "martibi02", "martibi02", "martibi02", "martibi02", "martibi02", "martibi02", "martibi02", "martibi02", "rosenal01", "rosenal01", "rosenal01", "rosenal01", "rosenal01", "rosenal01", "rosenal01", "rosenal01", "rosenal01", "rosenal01", "kuennha01", "kuennha01", "kuennha01", "kuennha01", "kuennha01", "kuennha01", "kuennha01", "kuennha01",
+#> "kuennha01", "kuennha01", "kuennha01", "kuennha01", "kuennha01", "kuennha01", "kuennha01", "kuennha01", "kuennha01", "gilliji01", "gilliji01", "gilliji01", "gilliji01", "gilliji01", "gilliji01", "gilliji01", "gilliji01", "gilliji01", "gilliji01", "gilliji01", "gilliji01", "gilliji01", "gilliji01", "schoere01", "schoere01", "schoere01", "schoere01", "schoere01", "schoere01", "schoere01", "schoere01", "schoere01", "schoere01", "schoere01", "schoere01", "schoere01", "schoere01", "schoere01", "schoere01",
+#> "schoere01", "schoere01", "schoere01", "schoere01", "schoere01", "portebo01", "portebo01", "portebo01", "portebo01", "portebo01", "portebo01", "portebo01", "portebo01", "portebo01", "portebo01", "portebo01", "portebo01", "portebo01", "portebo01", "portebo01", "portebo01", "rhodedu01", "rhodedu01", "rhodedu01", "rhodedu01", "rhodedu01", "rhodedu01", "rhodedu01", "grimbo01", "grimbo01", "grimbo01", "grimbo01", "grimbo01", "grimbo01", "grimbo01", "grimbo01", "grimbo01", "grimbo01", "grimbo01", "moonwa01",
+#> "moonwa01", "moonwa01", "moonwa01", "moonwa01", "moonwa01", "moonwa01", "moonwa01", "moonwa01", "moonwa01", "moonwa01", "moonwa01", "kluszte01", "kluszte01", "kluszte01", "kluszte01", "kluszte01", "kluszte01", "kluszte01", "kluszte01", "kluszte01", "kluszte01", "kluszte01", "kluszte01", "kluszte01", "kluszte01", "kluszte01", "kluszte01", "avilabo01", "avilabo01", "avilabo01", "avilabo01", "avilabo01", "avilabo01", "avilabo01", "avilabo01", "avilabo01", "avilabo01", "avilabo01", "avilabo01", "avilabo01",
+#> "antonjo02", "antonjo02", "antonjo02", "antonjo02", "antonjo02", "antonjo02", "antonjo02", "antonjo02", "antonjo02", "antonjo02", "antonjo02", "antonjo02", "antonjo02", "ayalabo01", "ayalabo01", "ayalabo01", "ayalabo01", "ayalabo01", "ayalabo01", "ayalabo01", "ayalabo01", "ayalabo01", "podrejo01", "podrejo01", "podrejo01", "podrejo01", "podrejo01", "podrejo01", "podrejo01", "podrejo01", "podrejo01", "podrejo01", "podrejo01", "podrejo01", "podrejo01", "podrejo01", "podrejo01", "podrejo01", "scorehe01",
+#> "scorehe01", "scorehe01", "scorehe01", "scorehe01", "scorehe01", "scorehe01", "scorehe01", "virdobi01", "virdobi01", "virdobi01", "virdobi01", "virdobi01", "virdobi01", "virdobi01", "virdobi01", "virdobi01", "virdobi01", "virdobi01", "virdobi01", "virdobi01", "foxne01", "foxne01", "foxne01", "foxne01", "foxne01", "foxne01", "foxne01", "foxne01", "foxne01", "foxne01", "foxne01", "foxne01", "foxne01", "foxne01", "foxne01", "foxne01", "foxne01", "foxne01", "foxne01", "matheed01", "matheed01", "matheed01",
+#> "matheed01", "matheed01", "matheed01", "matheed01", "matheed01", "matheed01", "matheed01", "matheed01", "matheed01", "matheed01", "matheed01", "matheed01", "matheed01", "matheed01", "matheed01", "kalinal01", "kalinal01", "kalinal01", "kalinal01", "kalinal01", "kalinal01", "kalinal01", "kalinal01", "kalinal01", "kalinal01", "kalinal01", "kalinal01", "kalinal01", "kalinal01", "kalinal01", "kalinal01", "kalinal01", "kalinal01", "kalinal01", "kalinal01", "kalinal01", "kalinal01", "fordwh01", "fordwh01",
+#> "fordwh01", "fordwh01", "fordwh01", "fordwh01", "fordwh01", "fordwh01", "fordwh01", "fordwh01", "fordwh01", "fordwh01", "fordwh01", "fordwh01", "fordwh01", "fordwh01", "bankser01", "bankser01", "bankser01", "bankser01", "bankser01", "bankser01", "bankser01", "bankser01", "bankser01", "bankser01", "bankser01", "bankser01", "bankser01", "bankser01", "bankser01", "bankser01", "bankser01", "bankser01", "bankser01", "larsedo01", "larsedo01", "larsedo01", "larsedo01", "larsedo01", "larsedo01", "larsedo01",
+#> "larsedo01", "larsedo01", "larsedo01", "larsedo01", "larsedo01", "larsedo01", "larsedo01", "larsedo01", "larsedo01", "larsedo01", "aparilu01", "aparilu01", "aparilu01", "aparilu01", "aparilu01", "aparilu01", "aparilu01", "aparilu01", "aparilu01", "aparilu01", "aparilu01", "aparilu01", "aparilu01", "aparilu01", "aparilu01", "aparilu01", "aparilu01", "aparilu01", "robinfr02", "robinfr02", "robinfr02", "robinfr02", "robinfr02", "robinfr02", "robinfr02", "robinfr02", "robinfr02", "robinfr02", "robinfr02",
+#> "robinfr02", "robinfr02", "robinfr02", "robinfr02", "robinfr02", "robinfr02", "robinfr02", "robinfr02", "robinfr02", "robinfr02", "robinfr02", "boyerke01", "boyerke01", "boyerke01", "boyerke01", "boyerke01", "boyerke01", "boyerke01", "boyerke01", "boyerke01", "boyerke01", "boyerke01", "boyerke01", "boyerke01", "boyerke01", "boyerke01", "boyerke01", "boyerke01", "aaronha01", "aaronha01", "aaronha01", "aaronha01", "aaronha01", "aaronha01", "aaronha01", "aaronha01", "aaronha01", "aaronha01", "aaronha01",
+#> "aaronha01", "aaronha01", "aaronha01", "aaronha01", "aaronha01", "aaronha01", "aaronha01", "aaronha01", "aaronha01", "aaronha01", "aaronha01", "aaronha01", "piercbi02", "piercbi02", "piercbi02", "piercbi02", "piercbi02", "piercbi02", "piercbi02", "piercbi02", "piercbi02", "piercbi02", "piercbi02", "piercbi02", "piercbi02", "piercbi02", "piercbi02", "piercbi02", "piercbi02", "piercbi02", "burdele01", "burdele01", "burdele01", "burdele01", "burdele01", "burdele01", "burdele01", "burdele01", "burdele01",
+#> "burdele01", "burdele01", "burdele01", "burdele01", "burdele01", "burdele01", "burdele01", "burdele01", "burdele01", "burdele01", "burdele01", "burdele01", "malzofr01", "malzofr01", "malzofr01", "malzofr01", "malzofr01", "malzofr01", "malzofr01", "malzofr01", "malzofr01", "malzofr01", "malzofr01", "malzofr01", "lollash01", "lollash01", "lollash01", "lollash01", "lollash01", "lollash01", "lollash01", "lollash01", "lollash01", "lollash01", "lollash01", "lollash01", "lollash01", "lollash01", "lollash01",
+#> "lollash01", "lollash01", "lollash01", "minosmi01", "minosmi01", "minosmi01", "minosmi01", "minosmi01", "minosmi01", "minosmi01", "minosmi01", "minosmi01", "minosmi01", "minosmi01", "minosmi01", "minosmi01", "minosmi01", "minosmi01", "minosmi01", "minosmi01", "minosmi01", "mcmilro01", "mcmilro01", "mcmilro01", "mcmilro01", "mcmilro01", "mcmilro01", "mcmilro01", "mcmilro01", "mcmilro01", "mcmilro01", "mcmilro01", "mcmilro01", "mcmilro01", "mcmilro01", "mcmilro01", "mcmilro01", "mcmilro01", "kubekto01",
+#> "kubekto01", "kubekto01", "kubekto01", "kubekto01", "kubekto01", "kubekto01", "kubekto01", "kubekto01", "sanfoja02", "sanfoja02", "sanfoja02", "sanfoja02", "sanfoja02", "sanfoja02", "sanfoja02", "sanfoja02", "sanfoja02", "sanfoja02", "sanfoja02", "sanfoja02", "sanfoja02", "sanfoja02", "bunniji01", "bunniji01", "bunniji01", "bunniji01", "bunniji01", "bunniji01", "bunniji01", "bunniji01", "bunniji01", "bunniji01", "bunniji01", "bunniji01", "bunniji01", "bunniji01", "bunniji01", "bunniji01", "bunniji01",
+#> "bunniji01", "howarel01", "howarel01", "howarel01", "howarel01", "howarel01", "howarel01", "howarel01", "howarel01", "howarel01", "howarel01", "howarel01", "howarel01", "howarel01", "howarel01", "howarel01", "turlebo01", "turlebo01", "turlebo01", "turlebo01", "turlebo01", "turlebo01", "turlebo01", "turlebo01", "turlebo01", "turlebo01", "turlebo01", "turlebo01", "turlebo01", "powervi01", "powervi01", "powervi01", "powervi01", "powervi01", "powervi01", "powervi01", "powervi01", "powervi01", "powervi01",
+#> "powervi01", "powervi01", "powervi01", "powervi01", "powervi01", "bollifr01", "bollifr01", "bollifr01", "bollifr01", "bollifr01", "bollifr01", "bollifr01", "bollifr01", "bollifr01", "bollifr01", "bollifr01", "bollifr01", "piersji01", "piersji01", "piersji01", "piersji01", "piersji01", "piersji01", "piersji01", "piersji01", "piersji01", "piersji01", "piersji01", "piersji01", "piersji01", "piersji01", "piersji01", "piersji01", "piersji01", "piersji01", "piersji01", "siebeno01", "siebeno01", "siebeno01",
+#> "siebeno01", "siebeno01", "siebeno01", "siebeno01", "siebeno01", "siebeno01", "siebeno01", "siebeno01", "siebeno01", "siebeno01", "mazerbi01", "mazerbi01", "mazerbi01", "mazerbi01", "mazerbi01", "mazerbi01", "mazerbi01", "mazerbi01", "mazerbi01", "mazerbi01", "mazerbi01", "mazerbi01", "mazerbi01", "mazerbi01", "mazerbi01", "mazerbi01", "mazerbi01", "crandde01", "crandde01", "crandde01", "crandde01", "crandde01", "crandde01", "crandde01", "crandde01", "crandde01", "crandde01", "crandde01", "crandde01",
+#> "crandde01", "crandde01", "crandde01", "crandde01", "haddiha01", "haddiha01", "haddiha01", "haddiha01", "haddiha01", "haddiha01", "haddiha01", "haddiha01", "haddiha01", "haddiha01", "haddiha01", "haddiha01", "haddiha01", "haddiha01", "haddiha01", "jenseja01", "jenseja01", "jenseja01", "jenseja01", "jenseja01", "jenseja01", "jenseja01", "jenseja01", "jenseja01", "jenseja01", "jenseja01", "jenseja01", "pearsal02", "pearsal02", "pearsal02", "pearsal02", "pearsal02", "pearsal02", "pearsal02", "pearsal02",
+#> "pearsal02", "pearsal02", "cepedor01", "cepedor01", "cepedor01", "cepedor01", "cepedor01", "cepedor01", "cepedor01", "cepedor01", "cepedor01", "cepedor01", "cepedor01", "cepedor01", "cepedor01", "cepedor01", "cepedor01", "cepedor01", "cepedor01", "cepedor01", "cepedor01", "thomafr03", "thomafr03", "thomafr03", "thomafr03", "thomafr03", "thomafr03", "thomafr03", "thomafr03", "thomafr03", "thomafr03", "thomafr03", "thomafr03", "thomafr03", "thomafr03", "thomafr03", "thomafr03", "thomafr03", "thomafr03",
+#> "thomafr03", "thomafr03", "frienbo01", "frienbo01", "frienbo01", "frienbo01", "frienbo01", "frienbo01", "frienbo01", "frienbo01", "frienbo01", "frienbo01", "frienbo01", "frienbo01", "frienbo01", "frienbo01", "frienbo01", "frienbo01", "frienbo01", "sherrla01", "sherrla01", "sherrla01", "sherrla01", "sherrla01", "sherrla01", "sherrla01", "sherrla01", "sherrla01", "sherrla01", "sherrla01", "sherrla01", "wynnea01", "wynnea01", "wynnea01", "wynnea01", "wynnea01", "wynnea01", "wynnea01", "wynnea01", "wynnea01",
+#> "wynnea01", "wynnea01", "wynnea01", "wynnea01", "wynnea01", "wynnea01", "wynnea01", "wynnea01", "wynnea01", "wynnea01", "wynnea01", "wynnea01", "wynnea01", "wynnea01", "nealch01", "nealch01", "nealch01", "nealch01", "nealch01", "nealch01", "nealch01", "nealch01", "nealch01", "brandja01", "brandja01", "brandja01", "brandja01", "brandja01", "brandja01", "brandja01", "brandja01", "brandja01", "brandja01", "brandja01", "brandja01", "brandja01", "allisbo01", "allisbo01", "allisbo01", "allisbo01", "allisbo01",
+#> "allisbo01", "allisbo01", "allisbo01", "allisbo01", "allisbo01", "allisbo01", "allisbo01", "allisbo01", "mccovwi01", "mccovwi01", "mccovwi01", "mccovwi01", "mccovwi01", "mccovwi01", "mccovwi01", "mccovwi01", "mccovwi01", "mccovwi01", "mccovwi01", "mccovwi01", "mccovwi01", "mccovwi01", "mccovwi01", "mccovwi01", "mccovwi01", "mccovwi01", "mccovwi01", "mccovwi01", "mccovwi01", "mccovwi01", "mccovwi01", "jonessa02", "jonessa02", "jonessa02", "jonessa02", "jonessa02", "jonessa02", "jonessa02", "jonessa02",
+#> "jonessa02", "jonessa02", "jonessa02", "jonessa02", "lawve01", "lawve01", "lawve01", "lawve01", "lawve01", "lawve01", "lawve01", "lawve01", "lawve01", "lawve01", "lawve01", "lawve01", "lawve01", "lawve01", "lawve01", "lawve01", "robinbr01", "robinbr01", "robinbr01", "robinbr01", "robinbr01", "robinbr01", "robinbr01", "robinbr01", "robinbr01", "robinbr01", "robinbr01", "robinbr01", "robinbr01", "robinbr01", "robinbr01", "robinbr01", "robinbr01", "robinbr01", "robinbr01", "robinbr01", "robinbr01",
+#> "robinbr01", "robinbr01", "batteea01", "batteea01", "batteea01", "batteea01", "batteea01", "batteea01", "batteea01", "batteea01", "batteea01", "batteea01", "batteea01", "batteea01", "batteea01", "landiji01", "landiji01", "landiji01", "landiji01", "landiji01", "landiji01", "landiji01", "landiji01", "landiji01", "landiji01", "landiji01", "landiji01", "landiji01", "marisro01", "marisro01", "marisro01", "marisro01", "marisro01", "marisro01", "marisro01", "marisro01", "marisro01", "marisro01", "marisro01",
+#> "marisro01", "marisro01", "whitebi03", "whitebi03", "whitebi03", "whitebi03", "whitebi03", "whitebi03", "whitebi03", "whitebi03", "whitebi03", "whitebi03", "whitebi03", "whitebi03", "whitebi03", "groatdi01", "groatdi01", "groatdi01", "groatdi01", "groatdi01", "groatdi01", "groatdi01", "groatdi01", "groatdi01", "groatdi01", "groatdi01", "groatdi01", "groatdi01", "groatdi01", "groatdi01", "hansero02", "hansero02", "hansero02", "hansero02", "hansero02", "hansero02", "hansero02", "hansero02", "hansero02",
+#> "hansero02", "hansero02", "hansero02", "hansero02", "hansero02", "hansero02", "hansero02", "howarfr01", "howarfr01", "howarfr01", "howarfr01", "howarfr01", "howarfr01", "howarfr01", "howarfr01", "howarfr01", "howarfr01", "howarfr01", "howarfr01", "howarfr01", "howarfr01", "howarfr01", "howarfr01", "howarfr01", "skowrbi01", "skowrbi01", "skowrbi01", "skowrbi01", "skowrbi01", "skowrbi01", "skowrbi01", "skowrbi01", "skowrbi01", "skowrbi01", "skowrbi01", "skowrbi01", "skowrbi01", "skowrbi01", "skowrbi01",
+#> "skowrbi01", "brogler01", "brogler01", "brogler01", "brogler01", "brogler01", "brogler01", "brogler01", "brogler01", "brogler01", "fornimi01", "fornimi01", "fornimi01", "fornimi01", "fornimi01", "fornimi01", "fornimi01", "fornimi01", "fornimi01", "fornimi01", "fornimi01", "fornimi01", "fornimi01", "fornimi01", "fornimi01", "mcdanli01", "mcdanli01", "mcdanli01", "mcdanli01", "mcdanli01", "mcdanli01", "mcdanli01", "mcdanli01", "mcdanli01", "mcdanli01", "mcdanli01", "mcdanli01", "mcdanli01", "mcdanli01",
+#> "mcdanli01", "mcdanli01", "mcdanli01", "mcdanli01", "mcdanli01", "mcdanli01", "mcdanli01", "mcdanli01", "estrach01", "estrach01", "estrach01", "estrach01", "estrach01", "estrach01", "estrach01", "richabo01", "richabo01", "richabo01", "richabo01", "richabo01", "richabo01", "richabo01", "richabo01", "richabo01", "richabo01", "richabo01", "richabo01", "laryfr01", "laryfr01", "laryfr01", "laryfr01", "laryfr01", "laryfr01", "laryfr01", "laryfr01", "laryfr01", "laryfr01", "laryfr01", "laryfr01", "laryfr01",
+#> "laryfr01", "laryfr01", "rosebjo01", "rosebjo01", "rosebjo01", "rosebjo01", "rosebjo01", "rosebjo01", "rosebjo01", "rosebjo01", "rosebjo01", "rosebjo01", "rosebjo01", "rosebjo01", "rosebjo01", "rosebjo01", "clemero01", "clemero01", "clemero01", "clemero01", "clemero01", "clemero01", "clemero01", "clemero01", "clemero01", "clemero01", "clemero01", "clemero01", "clemero01", "clemero01", "clemero01", "clemero01", "clemero01", "clemero01", "pinsova01", "pinsova01", "pinsova01", "pinsova01", "pinsova01",
+#> "pinsova01", "pinsova01", "pinsova01", "pinsova01", "pinsova01", "pinsova01", "pinsova01", "pinsova01", "pinsova01", "pinsova01", "pinsova01", "pinsova01", "pinsova01", "willsma01", "willsma01", "willsma01", "willsma01", "willsma01", "willsma01", "willsma01", "willsma01", "willsma01", "willsma01", "willsma01", "willsma01", "willsma01", "willsma01", "willsma01", "schwado01", "schwado01", "schwado01", "schwado01", "schwado01", "schwado01", "schwado01", "schwado01", "willibi01", "willibi01", "willibi01",
+#> "willibi01", "willibi01", "willibi01", "willibi01", "willibi01", "willibi01", "willibi01", "willibi01", "willibi01", "willibi01", "willibi01", "willibi01", "willibi01", "willibi01", "willibi01", "cashno01", "cashno01", "cashno01", "cashno01", "cashno01", "cashno01", "cashno01", "cashno01", "cashno01", "cashno01", "cashno01", "cashno01", "cashno01", "cashno01", "cashno01", "cashno01", "cashno01", "colavro01", "colavro01", "colavro01", "colavro01", "colavro01", "colavro01", "colavro01", "colavro01",
+#> "colavro01", "colavro01", "colavro01", "colavro01", "colavro01", "colavro01", "colavro01", "colavro01", "burgesm01", "burgesm01", "burgesm01", "burgesm01", "burgesm01", "burgesm01", "burgesm01", "burgesm01", "burgesm01", "burgesm01", "burgesm01", "burgesm01", "burgesm01", "burgesm01", "burgesm01", "burgesm01", "burgesm01", "burgesm01", "burgesm01", "burgesm01", "jayjo01", "jayjo01", "jayjo01", "jayjo01", "jayjo01", "jayjo01", "jayjo01", "jayjo01", "jayjo01", "jayjo01", "jayjo01", "jayjo01", "jayjo01",
+#> "jayjo01", "arroylu01", "arroylu01", "arroylu01", "arroylu01", "arroylu01", "arroylu01", "arroylu01", "arroylu01", "millest01", "millest01", "millest01", "millest01", "millest01", "millest01", "millest01", "millest01", "millest01", "millest01", "millest01", "millest01", "millest01", "millest01", "millest01", "millest01", "millest01", "wagnele01", "wagnele01", "wagnele01", "wagnele01", "wagnele01", "wagnele01", "wagnele01", "wagnele01", "wagnele01", "wagnele01", "wagnele01", "wagnele01", "wagnele01",
+#> "terryra01", "terryra01", "terryra01", "terryra01", "terryra01", "terryra01", "terryra01", "terryra01", "terryra01", "terryra01", "terryra01", "terryra01", "terryra01", "terryra01", "terryra01", "drysddo01", "drysddo01", "drysddo01", "drysddo01", "drysddo01", "drysddo01", "drysddo01", "drysddo01", "drysddo01", "drysddo01", "drysddo01", "drysddo01", "drysddo01", "drysddo01", "kaatji01", "kaatji01", "kaatji01", "kaatji01", "kaatji01", "kaatji01", "kaatji01", "kaatji01", "kaatji01", "kaatji01", "kaatji01",
+#> "kaatji01", "kaatji01", "kaatji01", "kaatji01", "kaatji01", "kaatji01", "kaatji01", "kaatji01", "kaatji01", "kaatji01", "kaatji01", "kaatji01", "kaatji01", "kaatji01", "kaatji01", "kaatji01", "kaatji01", "hubbske01", "hubbske01", "hubbske01", "davenji01", "davenji01", "davenji01", "davenji01", "davenji01", "davenji01", "davenji01", "davenji01", "davenji01", "davenji01", "davenji01", "davenji01", "davenji01", "treshto01", "treshto01", "treshto01", "treshto01", "treshto01", "treshto01", "treshto01",
+#> "treshto01", "treshto01", "treshto01", "donovdi01", "donovdi01", "donovdi01", "donovdi01", "donovdi01", "donovdi01", "donovdi01", "donovdi01", "donovdi01", "donovdi01", "donovdi01", "donovdi01", "donovdi01", "donovdi01", "donovdi01", "davisto02", "davisto02", "davisto02", "davisto02", "davisto02", "davisto02", "davisto02", "davisto02", "davisto02", "davisto02", "davisto02", "davisto02", "davisto02", "davisto02", "davisto02", "davisto02", "davisto02", "davisto02", "davisto02", "davisto02", "davisto02",
+#> "davisto02", "davisto02", "purkebo01", "purkebo01", "purkebo01", "purkebo01", "purkebo01", "purkebo01", "purkebo01", "purkebo01", "purkebo01", "purkebo01", "purkebo01", "purkebo01", "purkebo01", "radatdi01", "radatdi01", "radatdi01", "radatdi01", "radatdi01", "radatdi01", "radatdi01", "radatdi01", "radatdi01", "radatdi01", "facero01", "facero01", "facero01", "facero01", "facero01", "facero01", "facero01", "facero01", "facero01", "facero01", "facero01", "facero01", "facero01", "facero01", "facero01",
+#> "facero01", "facero01", "koufasa01", "koufasa01", "koufasa01", "koufasa01", "koufasa01", "koufasa01", "koufasa01", "koufasa01", "koufasa01", "koufasa01", "koufasa01", "koufasa01", "yastrca01", "yastrca01", "yastrca01", "yastrca01", "yastrca01", "yastrca01", "yastrca01", "yastrca01", "yastrca01", "yastrca01", "yastrca01", "yastrca01", "yastrca01", "yastrca01", "yastrca01", "yastrca01", "yastrca01", "yastrca01", "yastrca01", "yastrca01", "yastrca01", "yastrca01", "yastrca01", "versazo01", "versazo01",
+#> "versazo01", "versazo01", "versazo01", "versazo01", "versazo01", "versazo01", "versazo01", "versazo01", "versazo01", "versazo01", "versazo01", "edwarjo01", "edwarjo01", "edwarjo01", "edwarjo01", "edwarjo01", "edwarjo01", "edwarjo01", "edwarjo01", "edwarjo01", "edwarjo01", "edwarjo01", "edwarjo01", "edwarjo01", "edwarjo01", "floodcu01", "floodcu01", "floodcu01", "floodcu01", "floodcu01", "floodcu01", "floodcu01", "floodcu01", "floodcu01", "floodcu01", "floodcu01", "floodcu01", "floodcu01", "floodcu01",
+#> "floodcu01", "winebo01", "winebo01", "winebo01", "winebo01", "winebo01", "winebo01", "winebo01", "winebo01", "winebo01", "winebo01", "winebo01", "winebo01", "peterga01", "peterga01", "peterga01", "peterga01", "peterga01", "peterga01", "peterga01", "peterga01", "peterga01", "peterga01", "peterga01", "peterga01", "peterga01", "peterga01", "rosepe01", "rosepe01", "rosepe01", "rosepe01", "rosepe01", "rosepe01", "rosepe01", "rosepe01", "rosepe01", "rosepe01", "rosepe01", "rosepe01", "rosepe01", "rosepe01",
+#> "rosepe01", "rosepe01", "rosepe01", "rosepe01", "rosepe01", "rosepe01", "rosepe01", "rosepe01", "rosepe01", "rosepe01", "rosepe01", "pepitjo01", "pepitjo01", "pepitjo01", "pepitjo01", "pepitjo01", "pepitjo01", "pepitjo01", "pepitjo01", "pepitjo01", "pepitjo01", "pepitjo01", "pepitjo01", "pepitjo01", "pepitjo01", "maricju01", "maricju01", "maricju01", "maricju01", "maricju01", "maricju01", "maricju01", "maricju01", "maricju01", "maricju01", "maricju01", "maricju01", "maricju01", "maricju01", "maricju01",
+#> "maricju01", "callijo01", "callijo01", "callijo01", "callijo01", "callijo01", "callijo01", "callijo01", "callijo01", "callijo01", "callijo01", "callijo01", "callijo01", "callijo01", "callijo01", "callijo01", "callijo01", "gibsobo01", "gibsobo01", "gibsobo01", "gibsobo01", "gibsobo01", "gibsobo01", "gibsobo01", "gibsobo01", "gibsobo01", "gibsobo01", "gibsobo01", "gibsobo01", "gibsobo01", "gibsobo01", "gibsobo01", "gibsobo01", "gibsobo01", "chancde01", "chancde01", "chancde01", "chancde01", "chancde01",
+#> "chancde01", "chancde01", "chancde01", "chancde01", "chancde01", "chancde01", "chancde01", "davalvi01", "davalvi01", "davalvi01", "davalvi01", "davalvi01", "davalvi01", "davalvi01", "davalvi01", "davalvi01", "davalvi01", "davalvi01", "davalvi01", "davalvi01", "davalvi01", "davalvi01", "davalvi01", "davalvi01", "davalvi01", "davalvi01", "santoro01", "santoro01", "santoro01", "santoro01", "santoro01", "santoro01", "santoro01", "santoro01", "santoro01", "santoro01", "santoro01", "santoro01", "santoro01",
+#> "santoro01", "santoro01", "amaroru01", "amaroru01", "amaroru01", "amaroru01", "amaroru01", "amaroru01", "amaroru01", "amaroru01", "amaroru01", "amaroru01", "amaroru01", "olivato01", "olivato01", "olivato01", "olivato01", "olivato01", "olivato01", "olivato01", "olivato01", "olivato01", "olivato01", "olivato01", "olivato01", "olivato01", "olivato01", "olivato01", "allendi01", "allendi01", "allendi01", "allendi01", "allendi01", "allendi01", "allendi01", "allendi01", "allendi01", "allendi01", "allendi01",
+#> "allendi01", "allendi01", "allendi01", "allendi01", "stuardi01", "stuardi01", "stuardi01", "stuardi01", "stuardi01", "stuardi01", "stuardi01", "stuardi01", "stuardi01", "stuardi01", "stuardi01", "killeha01", "killeha01", "killeha01", "killeha01", "killeha01", "killeha01", "killeha01", "killeha01", "killeha01", "killeha01", "killeha01", "killeha01", "killeha01", "killeha01", "killeha01", "killeha01", "killeha01", "killeha01", "killeha01", "killeha01", "killeha01", "killeha01", "fregoji01", "fregoji01",
+#> "fregoji01", "fregoji01", "fregoji01", "fregoji01", "fregoji01", "fregoji01", "fregoji01", "fregoji01", "fregoji01", "fregoji01", "fregoji01", "fregoji01", "fregoji01", "fregoji01", "fregoji01", "fregoji01", "fregoji01", "fregoji01", "huntro01", "huntro01", "huntro01", "huntro01", "huntro01", "huntro01", "huntro01", "huntro01", "huntro01", "huntro01", "huntro01", "huntro01", "huntro01", "torrejo01", "torrejo01", "torrejo01", "torrejo01", "torrejo01", "torrejo01", "torrejo01", "torrejo01", "torrejo01",
+#> "torrejo01", "torrejo01", "torrejo01", "torrejo01", "torrejo01", "torrejo01", "torrejo01", "torrejo01", "torrejo01", "mcbeaal01", "mcbeaal01", "mcbeaal01", "mcbeaal01", "mcbeaal01", "mcbeaal01", "mcbeaal01", "mcbeaal01", "mcbeaal01", "mcbeaal01", "mcbeaal01", "mcbeaal01", "freehbi01", "freehbi01", "freehbi01", "freehbi01", "freehbi01", "freehbi01", "freehbi01", "freehbi01", "freehbi01", "freehbi01", "freehbi01", "freehbi01", "freehbi01", "freehbi01", "freehbi01", "cardele01", "cardele01", "cardele01",
+#> "cardele01", "cardele01", "cardele01", "cardele01", "cardele01", "cardele01", "cardele01", "cardele01", "cardele01", "cardele01", "cardele01", "cardele01", "cardele01", "blefacu01", "blefacu01", "blefacu01", "blefacu01", "blefacu01", "blefacu01", "blefacu01", "blefacu01", "blefacu01", "blefacu01", "lefebji01", "lefebji01", "lefebji01", "lefebji01", "lefebji01", "lefebji01", "lefebji01", "lefebji01", "whitffr01", "whitffr01", "whitffr01", "whitffr01", "whitffr01", "whitffr01", "whitffr01", "whitffr01",
+#> "whitffr01", "hallji02", "hallji02", "hallji02", "hallji02", "hallji02", "hallji02", "hallji02", "hallji02", "hallji02", "hallji02", "hallji02", "hallji02", "grantmu01", "grantmu01", "grantmu01", "grantmu01", "grantmu01", "grantmu01", "grantmu01", "grantmu01", "grantmu01", "grantmu01", "grantmu01", "grantmu01", "grantmu01", "grantmu01", "grantmu01", "grantmu01", "grantmu01", "grantmu01", "stottme01", "stottme01", "stottme01", "stottme01", "stottme01", "stottme01", "stottme01", "stottme01", "stottme01",
+#> "stottme01", "stottme01", "johnsde01", "johnsde01", "johnsde01", "johnsde01", "johnsde01", "johnsde01", "johnsde01", "johnsde01", "johnsde01", "johnsde01", "johnsde01", "johnsde01", "johnsde01", "johnsde01", "johnsde01", "johnsde01", "johnsde01", "johnsde01", "johnsde01", "johnsde01", "johnsde01", "stargwi01", "stargwi01", "stargwi01", "stargwi01", "stargwi01", "stargwi01", "stargwi01", "stargwi01", "stargwi01", "stargwi01", "stargwi01", "stargwi01", "stargwi01", "stargwi01", "stargwi01", "stargwi01",
+#> "stargwi01", "stargwi01", "stargwi01", "stargwi01", "stargwi01", "fisheed02", "fisheed02", "fisheed02", "fisheed02", "fisheed02", "fisheed02", "fisheed02", "fisheed02", "fisheed02", "fisheed02", "fisheed02", "fisheed02", "fisheed02", "fisheed02", "fisheed02", "fisheed02", "fisheed02", "fisheed02", "abernte02", "abernte02", "abernte02", "abernte02", "abernte02", "abernte02", "abernte02", "abernte02", "abernte02", "abernte02", "abernte02", "abernte02", "abernte02", "abernte02", "abernte02", "abernte02",
+#> "abernte02", "knoopbo01", "knoopbo01", "knoopbo01", "knoopbo01", "knoopbo01", "knoopbo01", "knoopbo01", "knoopbo01", "knoopbo01", "knoopbo01", "ageeto01", "ageeto01", "ageeto01", "ageeto01", "ageeto01", "ageeto01", "ageeto01", "ageeto01", "ageeto01", "ageeto01", "ageeto01", "ageeto01", "ageeto01", "alleyge01", "alleyge01", "alleyge01", "alleyge01", "alleyge01", "alleyge01", "alleyge01", "alleyge01", "alleyge01", "alleyge01", "alleyge01", "helmsto01", "helmsto01", "helmsto01", "helmsto01", "helmsto01",
+#> "helmsto01", "helmsto01", "helmsto01", "helmsto01", "helmsto01", "helmsto01", "helmsto01", "helmsto01", "helmsto01", "helmsto01", "powelbo01", "powelbo01", "powelbo01", "powelbo01", "powelbo01", "powelbo01", "powelbo01", "powelbo01", "powelbo01", "powelbo01", "powelbo01", "powelbo01", "powelbo01", "powelbo01", "powelbo01", "powelbo01", "powelbo01", "casanpa01", "casanpa01", "casanpa01", "casanpa01", "casanpa01", "casanpa01", "casanpa01", "casanpa01", "casanpa01", "casanpa01", "wilsoea01", "wilsoea01",
+#> "wilsoea01", "wilsoea01", "wilsoea01", "wilsoea01", "wilsoea01", "wilsoea01", "wilsoea01", "wilsoea01", "wilsoea01", "wilsoea01", "wilsoea01", "aloufe01", "aloufe01", "aloufe01", "aloufe01", "aloufe01", "aloufe01", "aloufe01", "aloufe01", "aloufe01", "aloufe01", "aloufe01", "aloufe01", "aloufe01", "aloufe01", "aloufe01", "aloufe01", "aloufe01", "aloufe01", "aloufe01", "akerja01", "akerja01", "akerja01", "akerja01", "akerja01", "akerja01", "akerja01", "akerja01", "akerja01", "akerja01", "akerja01",
+#> "akerja01", "akerja01", "akerja01", "reganph01", "reganph01", "reganph01", "reganph01", "reganph01", "reganph01", "reganph01", "reganph01", "reganph01", "reganph01", "reganph01", "reganph01", "reganph01", "reganph01", "reganph01", "perezto01", "perezto01", "perezto01", "perezto01", "perezto01", "perezto01", "perezto01", "perezto01", "perezto01", "perezto01", "perezto01", "perezto01", "perezto01", "perezto01", "perezto01", "perezto01", "perezto01", "perezto01", "perezto01", "perezto01", "perezto01",
+#> "perezto01", "perezto01", "brocklo01", "brocklo01", "brocklo01", "brocklo01", "brocklo01", "brocklo01", "brocklo01", "brocklo01", "brocklo01", "brocklo01", "brocklo01", "brocklo01", "brocklo01", "brocklo01", "brocklo01", "brocklo01", "brocklo01", "brocklo01", "brocklo01", "brocklo01", "lonboji01", "lonboji01", "lonboji01", "lonboji01", "lonboji01", "lonboji01", "lonboji01", "lonboji01", "lonboji01", "lonboji01", "lonboji01", "lonboji01", "lonboji01", "lonboji01", "lonboji01", "mccormi03", "mccormi03",
+#> "mccormi03", "mccormi03", "mccormi03", "mccormi03", "mccormi03", "mccormi03", "mccormi03", "mccormi03", "mccormi03", "mccormi03", "mccormi03", "mccormi03", "mccormi03", "mccormi03", "mccormi03", "scottge02", "scottge02", "scottge02", "scottge02", "scottge02", "scottge02", "scottge02", "scottge02", "scottge02", "scottge02", "scottge02", "scottge02", "scottge02", "scottge02", "scottge02", "scottge02", "blairpa01", "blairpa01", "blairpa01", "blairpa01", "blairpa01", "blairpa01", "blairpa01", "blairpa01",
+#> "blairpa01", "blairpa01", "blairpa01", "blairpa01", "blairpa01", "blairpa01", "blairpa01", "blairpa01", "blairpa01", "blairpa01", "parkewe01", "parkewe01", "parkewe01", "parkewe01", "parkewe01", "parkewe01", "parkewe01", "parkewe01", "parkewe01", "hundlra01", "hundlra01", "hundlra01", "hundlra01", "hundlra01", "hundlra01", "hundlra01", "hundlra01", "hundlra01", "hundlra01", "hundlra01", "hundlra01", "hundlra01", "hundlra01", "carewro01", "carewro01", "carewro01", "carewro01", "carewro01", "carewro01",
+#> "carewro01", "carewro01", "carewro01", "carewro01", "carewro01", "carewro01", "carewro01", "carewro01", "carewro01", "carewro01", "carewro01", "carewro01", "carewro01", "seaveto01", "seaveto01", "seaveto01", "seaveto01", "seaveto01", "seaveto01", "seaveto01", "seaveto01", "seaveto01", "seaveto01", "seaveto01", "seaveto01", "seaveto01", "seaveto01", "seaveto01", "seaveto01", "seaveto01", "seaveto01", "seaveto01", "seaveto01", "seaveto01", "seaveto01", "mccarti01", "mccarti01", "mccarti01", "mccarti01",
+#> "mccarti01", "mccarti01", "mccarti01", "mccarti01", "mccarti01", "mccarti01", "mccarti01", "mccarti01", "mccarti01", "mccarti01", "mccarti01", "mccarti01", "mccarti01", "mccarti01", "mccarti01", "mccarti01", "mccarti01", "mccarti01", "mccarti01", "mccarti01", "wynnji01", "wynnji01", "wynnji01", "wynnji01", "wynnji01", "wynnji01", "wynnji01", "wynnji01", "wynnji01", "wynnji01", "wynnji01", "wynnji01", "wynnji01", "wynnji01", "wynnji01", "wynnji01", "jenkife01", "jenkife01", "jenkife01", "jenkife01",
+#> "jenkife01", "jenkife01", "jenkife01", "jenkife01", "jenkife01", "jenkife01", "jenkife01", "jenkife01", "jenkife01", "jenkife01", "jenkife01", "jenkife01", "jenkife01", "jenkife01", "jenkife01", "jenkife01", "rojasmi01", "rojasmi01", "rojasmi01", "lolicmi01", "lolicmi01", "lolicmi01", "lolicmi01", "lolicmi01", "lolicmi01", "lolicmi01", "lolicmi01", "lolicmi01", "lolicmi01", "lolicmi01", "lolicmi01", "lolicmi01", "lolicmi01", "lolicmi01", "lolicmi01", "mclaide01", "mclaide01", "mclaide01", "mclaide01",
+#> "mclaide01", "mclaide01", "mclaide01", "mclaide01", "mclaide01", "mclaide01", "mclaide01", "smithre06", "smithre06", "smithre06", "smithre06", "smithre06", "smithre06", "smithre06", "smithre06", "smithre06", "smithre06", "smithre06", "smithre06", "smithre06", "smithre06", "smithre06", "smithre06", "smithre06", "smithre06", "stanlmi01", "stanlmi01", "stanlmi01", "stanlmi01", "stanlmi01", "stanlmi01", "stanlmi01", "stanlmi01", "stanlmi01", "stanlmi01", "stanlmi01", "stanlmi01", "stanlmi01", "stanlmi01",
+#> "stanlmi01", "beckegl01", "beckegl01", "beckegl01", "beckegl01", "beckegl01", "beckegl01", "beckegl01", "beckegl01", "beckegl01", "beckegl01", "beckegl01", "benchjo01", "benchjo01", "benchjo01", "benchjo01", "benchjo01", "benchjo01", "benchjo01", "benchjo01", "benchjo01", "benchjo01", "benchjo01", "benchjo01", "benchjo01", "benchjo01", "benchjo01", "benchjo01", "benchjo01", "maxvida01", "maxvida01", "maxvida01", "maxvida01", "maxvida01", "maxvida01", "maxvida01", "maxvida01", "maxvida01", "maxvida01",
+#> "maxvida01", "maxvida01", "maxvida01", "maxvida01", "maxvida01", "maxvida01", "maxvida01", "bahnsst01", "bahnsst01", "bahnsst01", "bahnsst01", "bahnsst01", "bahnsst01", "bahnsst01", "bahnsst01", "bahnsst01", "bahnsst01", "bahnsst01", "bahnsst01", "bahnsst01", "bahnsst01", "bahnsst01", "bahnsst01", "bahnsst01", "bahnsst01", "bahnsst01", "harreke01", "harreke01", "harreke01", "harreke01", "harreke01", "harreke01", "harreke01", "harreke01", "harreke01", "harreke01", "harreke01", "harreke01", "harreke01",
+#> "hortowi01", "hortowi01", "hortowi01", "hortowi01", "hortowi01", "hortowi01", "hortowi01", "hortowi01", "hortowi01", "hortowi01", "hortowi01", "hortowi01", "hortowi01", "hortowi01", "hortowi01", "hortowi01", "hortowi01", "hortowi01", "hortowi01", "hortowi01", "hortowi01", "mcnalda01", "mcnalda01", "mcnalda01", "mcnalda01", "mcnalda01", "mcnalda01", "mcnalda01", "mcnalda01", "mcnalda01", "mcnalda01", "mcnalda01", "mcnalda01", "mcnalda01", "mcnalda01", "kessido01", "kessido01", "kessido01", "kessido01",
+#> "kessido01", "kessido01", "kessido01", "kessido01", "kessido01", "kessido01", "kessido01", "kessido01", "kessido01", "kessido01", "kessido01", "kessido01", "kessido01", "woodwi01", "woodwi01", "woodwi01", "woodwi01", "woodwi01", "woodwi01", "woodwi01", "woodwi01", "woodwi01", "woodwi01", "woodwi01", "woodwi01", "woodwi01", "woodwi01", "woodwi01", "woodwi01", "woodwi01", "woodwi01", "weisal01", "weisal01", "weisal01", "weisal01", "weisal01", "weisal01", "weisal01", "weisal01", "weisal01", "weisal01",
+#> "cuellmi01", "cuellmi01", "cuellmi01", "cuellmi01", "cuellmi01", "cuellmi01", "cuellmi01", "cuellmi01", "cuellmi01", "cuellmi01", "cuellmi01", "cuellmi01", "cuellmi01", "cuellmi01", "cuellmi01", "johnsda02", "johnsda02", "johnsda02", "johnsda02", "johnsda02", "johnsda02", "johnsda02", "johnsda02", "johnsda02", "johnsda02", "johnsda02", "johnsda02", "johnsda02", "johnsda02", "belanma01", "belanma01", "belanma01", "belanma01", "belanma01", "belanma01", "belanma01", "belanma01", "belanma01", "belanma01",
+#> "belanma01", "belanma01", "belanma01", "belanma01", "belanma01", "belanma01", "belanma01", "belanma01", "millafe01", "millafe01", "millafe01", "millafe01", "millafe01", "millafe01", "millafe01", "millafe01", "millafe01", "millafe01", "millafe01", "millafe01", "boyercl02", "boyercl02", "boyercl02", "boyercl02", "boyercl02", "boyercl02", "boyercl02", "boyercl02", "boyercl02", "boyercl02", "boyercl02", "boyercl02", "boyercl02", "boyercl02", "boyercl02", "boyercl02", "pinielo01", "pinielo01", "pinielo01",
+#> "pinielo01", "pinielo01", "pinielo01", "pinielo01", "pinielo01", "pinielo01", "pinielo01", "pinielo01", "pinielo01", "pinielo01", "pinielo01", "pinielo01", "pinielo01", "pinielo01", "pinielo01", "sizemte01", "sizemte01", "sizemte01", "sizemte01", "sizemte01", "sizemte01", "sizemte01", "sizemte01", "sizemte01", "sizemte01", "sizemte01", "sizemte01", "sizemte01", "jacksre01", "jacksre01", "jacksre01", "jacksre01", "jacksre01", "jacksre01", "jacksre01", "jacksre01", "jacksre01", "jacksre01", "jacksre01",
+#> "jacksre01", "jacksre01", "jacksre01", "jacksre01", "jacksre01", "jacksre01", "jacksre01", "jacksre01", "jacksre01", "jacksre01", "petrori01", "petrori01", "petrori01", "petrori01", "petrori01", "petrori01", "petrori01", "petrori01", "petrori01", "petrori01", "petrori01", "petrori01", "petrori01", "carltst01", "carltst01", "carltst01", "carltst01", "carltst01", "carltst01", "carltst01", "carltst01", "carltst01", "carltst01", "carltst01", "carltst01", "carltst01", "carltst01", "carltst01", "carltst01",
+#> "carltst01", "carltst01", "carltst01", "carltst01", "carltst01", "carltst01", "carltst01", "carltst01", "carltst01", "carltst01", "carltst01", "alouma01", "alouma01", "alouma01", "alouma01", "alouma01", "alouma01", "alouma01", "alouma01", "alouma01", "alouma01", "alouma01", "alouma01", "alouma01", "alouma01", "alouma01", "alouma01", "alouma01", "jonescl01", "jonescl01", "jonescl01", "jonescl01", "jonescl01", "jonescl01", "jonescl01", "jonescl01", "jonescl01", "jonescl01", "jonescl01", "jonescl01",
+#> "jonescl01", "perraro01", "perraro01", "perraro01", "perraro01", "perraro01", "perraro01", "perraro01", "perraro01", "perraro01", "perraro01", "perraro01", "perraro01", "perraro01", "perraro01", "perraro01", "grangwa01", "grangwa01", "grangwa01", "grangwa01", "grangwa01", "grangwa01", "grangwa01", "grangwa01", "grangwa01", "grangwa01", "clenddo01", "clenddo01", "clenddo01", "clenddo01", "clenddo01", "clenddo01", "clenddo01", "clenddo01", "clenddo01", "clenddo01", "clenddo01", "clenddo01", "clenddo01",
+#> "perryji01", "perryji01", "perryji01", "perryji01", "perryji01", "perryji01", "perryji01", "perryji01", "perryji01", "perryji01", "perryji01", "perryji01", "perryji01", "perryji01", "perryji01", "perryji01", "perryji01", "perryji01", "perryji01", "spencji01", "spencji01", "spencji01", "spencji01", "spencji01", "spencji01", "spencji01", "spencji01", "spencji01", "spencji01", "spencji01", "spencji01", "spencji01", "spencji01", "spencji01", "spencji01", "spencji01", "fossera01", "fossera01", "fossera01",
+#> "fossera01", "fossera01", "fossera01", "fossera01", "fossera01", "fossera01", "fossera01", "fossera01", "fossera01", "fossera01", "berryke01", "berryke01", "berryke01", "berryke01", "berryke01", "berryke01", "berryke01", "berryke01", "berryke01", "berryke01", "berryke01", "berryke01", "berryke01", "berryke01", "raderdo02", "raderdo02", "raderdo02", "raderdo02", "raderdo02", "raderdo02", "raderdo02", "raderdo02", "raderdo02", "raderdo02", "raderdo02", "raderdo02", "conigto01", "conigto01", "conigto01",
+#> "conigto01", "conigto01", "conigto01", "conigto01", "conigto01", "munsoth01", "munsoth01", "munsoth01", "munsoth01", "munsoth01", "munsoth01", "munsoth01", "munsoth01", "munsoth01", "munsoth01", "munsoth01", "mortoca01", "mortoca01", "mortoca01", "mortoca01", "mortoca01", "mortoca01", "mortoca01", "mortoca01", "mcdowsa01", "mcdowsa01", "mcdowsa01", "mcdowsa01", "mcdowsa01", "mcdowsa01", "mcdowsa01", "mcdowsa01", "mcdowsa01", "mcdowsa01", "mcdowsa01", "mcdowsa01", "mcdowsa01", "mcdowsa01", "mcdowsa01",
+#> "mcdowsa01", "merriji01", "merriji01", "merriji01", "merriji01", "merriji01", "merriji01", "merriji01", "merriji01", "merriji01", "merriji01", "merriji01", "tolanbo01", "tolanbo01", "tolanbo01", "tolanbo01", "tolanbo01", "tolanbo01", "tolanbo01", "tolanbo01", "tolanbo01", "tolanbo01", "tolanbo01", "tolanbo01", "tolanbo01", "tolanbo01", "bluevi01", "bluevi01", "bluevi01", "bluevi01", "bluevi01", "bluevi01", "bluevi01", "bluevi01", "bluevi01", "bluevi01", "bluevi01", "bluevi01", "bluevi01", "bluevi01",
+#> "bluevi01", "bluevi01", "bluevi01", "otisam01", "otisam01", "otisam01", "otisam01", "otisam01", "otisam01", "otisam01", "otisam01", "otisam01", "otisam01", "otisam01", "otisam01", "otisam01", "otisam01", "otisam01", "otisam01", "otisam01", "bondsbo01", "bondsbo01", "bondsbo01", "bondsbo01", "bondsbo01", "bondsbo01", "bondsbo01", "bondsbo01", "bondsbo01", "bondsbo01", "bondsbo01", "bondsbo01", "bondsbo01", "bondsbo01", "bondsbo01", "daviswi02", "daviswi02", "daviswi02", "daviswi02", "daviswi02", "daviswi02",
+#> "daviswi02", "daviswi02", "daviswi02", "daviswi02", "daviswi02", "daviswi02", "daviswi02", "daviswi02", "daviswi02", "daviswi02", "daviswi02", "daviswi02", "daviswi02", "harrebu01", "harrebu01", "harrebu01", "harrebu01", "harrebu01", "harrebu01", "harrebu01", "harrebu01", "harrebu01", "harrebu01", "harrebu01", "harrebu01", "harrebu01", "harrebu01", "harrebu01", "harrebu01", "chambch01", "chambch01", "chambch01", "chambch01", "chambch01", "chambch01", "chambch01", "chambch01", "chambch01", "chambch01",
+#> "chambch01", "chambch01", "chambch01", "chambch01", "chambch01", "chambch01", "chambch01", "chambch01", "williea02", "williea02", "williea02", "williea02", "williea02", "williea02", "williea02", "williea02", "williea02", "rojasco01", "rojasco01", "rojasco01", "rojasco01", "rojasco01", "rojasco01", "rojasco01", "rojasco01", "rojasco01", "rojasco01", "rojasco01", "rojasco01", "rojasco01", "rojasco01", "rojasco01", "rojasco01", "rojasco01", "murcebo01", "murcebo01", "murcebo01", "murcebo01", "murcebo01",
+#> "murcebo01", "murcebo01", "murcebo01", "murcebo01", "murcebo01", "murcebo01", "murcebo01", "murcebo01", "murcebo01", "murcebo01", "murcebo01", "murcebo01", "murcebo01", "retteme01", "retteme01", "retteme01", "retteme01", "retteme01", "retteme01", "retteme01", "retteme01", "retteme01", "retteme01", "retteme01", "retteme01", "retteme01", "palmeji01", "palmeji01", "palmeji01", "palmeji01", "palmeji01", "palmeji01", "palmeji01", "palmeji01", "palmeji01", "palmeji01", "palmeji01", "palmeji01", "palmeji01",
+#> "palmeji01", "palmeji01", "palmeji01", "palmeji01", "palmeji01", "palmeji01", "mayle01", "mayle01", "mayle01", "mayle01", "mayle01", "mayle01", "mayle01", "mayle01", "mayle01", "mayle01", "mayle01", "mayle01", "mayle01", "mayle01", "mayle01", "mayle01", "mayle01", "mayle01", "sanguma01", "sanguma01", "sanguma01", "sanguma01", "sanguma01", "sanguma01", "sanguma01", "sanguma01", "sanguma01", "sanguma01", "sanguma01", "sanguma01", "sanguma01", "sandeke01", "sandeke01", "sandeke01", "sandeke01", "sandeke01",
+#> "sandeke01", "sandeke01", "sandeke01", "sandeke01", "sandeke01", "sandeke01", "sandeke01", "sandeke01", "sandeke01", "giustda01", "giustda01", "giustda01", "giustda01", "giustda01", "giustda01", "giustda01", "giustda01", "giustda01", "giustda01", "giustda01", "giustda01", "giustda01", "giustda01", "giustda01", "giustda01", "morgajo02", "morgajo02", "morgajo02", "morgajo02", "morgajo02", "morgajo02", "morgajo02", "morgajo02", "morgajo02", "morgajo02", "morgajo02", "morgajo02", "morgajo02", "morgajo02",
+#> "morgajo02", "morgajo02", "morgajo02", "morgajo02", "morgajo02", "morgajo02", "morgajo02", "morgajo02", "tenacge01", "tenacge01", "tenacge01", "tenacge01", "tenacge01", "tenacge01", "tenacge01", "tenacge01", "tenacge01", "tenacge01", "tenacge01", "tenacge01", "tenacge01", "tenacge01", "tenacge01", "perryga01", "perryga01", "perryga01", "perryga01", "perryga01", "perryga01", "perryga01", "perryga01", "perryga01", "perryga01", "perryga01", "perryga01", "perryga01", "perryga01", "perryga01", "perryga01",
+#> "perryga01", "perryga01", "perryga01", "perryga01", "perryga01", "perryga01", "perryga01", "perryga01", "perryga01", "griffdo01", "griffdo01", "griffdo01", "griffdo01", "griffdo01", "griffdo01", "griffdo01", "griffdo01", "fiskca01", "fiskca01", "fiskca01", "fiskca01", "fiskca01", "fiskca01", "fiskca01", "fiskca01", "fiskca01", "fiskca01", "fiskca01", "fiskca01", "fiskca01", "fiskca01", "fiskca01", "fiskca01", "fiskca01", "fiskca01", "fiskca01", "fiskca01", "fiskca01", "fiskca01", "fiskca01", "fiskca01",
+#> "brinked01", "brinked01", "brinked01", "brinked01", "brinked01", "brinked01", "brinked01", "brinked01", "brinked01", "brinked01", "brinked01", "brinked01", "brinked01", "brinked01", "brinked01", "brinked01", "brinked01", "cedence01", "cedence01", "cedence01", "cedence01", "cedence01", "cedence01", "cedence01", "cedence01", "cedence01", "cedence01", "cedence01", "cedence01", "cedence01", "cedence01", "cedence01", "cedence01", "cedence01", "cedence01", "bowala01", "bowala01", "bowala01", "bowala01",
+#> "bowala01", "bowala01", "bowala01", "bowala01", "bowala01", "bowala01", "bowala01", "bowala01", "bowala01", "bowala01", "bowala01", "bowala01", "bowala01", "matlajo01", "matlajo01", "matlajo01", "matlajo01", "matlajo01", "matlajo01", "matlajo01", "matlajo01", "matlajo01", "matlajo01", "matlajo01", "matlajo01", "matlajo01", "rudijo01", "rudijo01", "rudijo01", "rudijo01", "rudijo01", "rudijo01", "rudijo01", "rudijo01", "rudijo01", "rudijo01", "rudijo01", "rudijo01", "rudijo01", "rudijo01", "rudijo01",
+#> "rudijo01", "scheiri01", "scheiri01", "scheiri01", "scheiri01", "scheiri01", "scheiri01", "scheiri01", "scheiri01", "scheiri01", "scheiri01", "scheiri01", "speiech01", "speiech01", "speiech01", "speiech01", "speiech01", "speiech01", "speiech01", "speiech01", "speiech01", "speiech01", "speiech01", "speiech01", "speiech01", "speiech01", "speiech01", "speiech01", "speiech01", "speiech01", "speiech01", "speiech01", "speiech01", "speiech01", "lylesp01", "lylesp01", "lylesp01", "lylesp01", "lylesp01",
+#> "lylesp01", "lylesp01", "lylesp01", "lylesp01", "lylesp01", "lylesp01", "lylesp01", "lylesp01", "lylesp01", "lylesp01", "lylesp01", "lylesp01", "lylesp01", "carrocl02", "carrocl02", "carrocl02", "carrocl02", "carrocl02", "carrocl02", "carrocl02", "carrocl02", "carrocl02", "carrocl02", "carrocl02", "carrocl02", "carrocl02", "carrocl02", "carrocl02", "carrocl02", "carrocl02", "campabe01", "campabe01", "campabe01", "campabe01", "campabe01", "campabe01", "campabe01", "campabe01", "campabe01", "campabe01",
+#> "campabe01", "campabe01", "campabe01", "campabe01", "campabe01", "campabe01", "campabe01", "campabe01", "campabe01", "campabe01", "grichbo01", "grichbo01", "grichbo01", "grichbo01", "grichbo01", "grichbo01", "grichbo01", "grichbo01", "grichbo01", "grichbo01", "grichbo01", "grichbo01", "grichbo01", "grichbo01", "grichbo01", "grichbo01", "grichbo01", "jorgemi01", "jorgemi01", "jorgemi01", "jorgemi01", "jorgemi01", "jorgemi01", "jorgemi01", "jorgemi01", "jorgemi01", "jorgemi01", "jorgemi01", "jorgemi01",
+#> "jorgemi01", "jorgemi01", "jorgemi01", "jorgemi01", "jorgemi01", "jorgemi01", "jorgemi01", "jorgemi01", "metzgro01", "metzgro01", "metzgro01", "metzgro01", "metzgro01", "metzgro01", "metzgro01", "metzgro01", "metzgro01", "metzgro01", "metzgro01", "metzgro01", "hillejo01", "hillejo01", "hillejo01", "hillejo01", "hillejo01", "hillejo01", "hillejo01", "hillejo01", "hillejo01", "hillejo01", "hillejo01", "hillejo01", "hillejo01", "hillejo01", "hillejo01", "bumbral01", "bumbral01", "bumbral01", "bumbral01",
+#> "bumbral01", "bumbral01", "bumbral01", "bumbral01", "bumbral01", "bumbral01", "bumbral01", "bumbral01", "bumbral01", "bumbral01", "matthga01", "matthga01", "matthga01", "matthga01", "matthga01", "matthga01", "matthga01", "matthga01", "matthga01", "matthga01", "matthga01", "matthga01", "matthga01", "matthga01", "matthga01", "matthga01", "matthga01", "maybejo01", "maybejo01", "maybejo01", "maybejo01", "maybejo01", "maybejo01", "maybejo01", "maybejo01", "maybejo01", "maybejo01", "maybejo01", "maybejo01",
+#> "maybejo01", "maybejo01", "maybejo01", "maybejo01", "bandosa01", "bandosa01", "bandosa01", "bandosa01", "bandosa01", "bandosa01", "bandosa01", "bandosa01", "bandosa01", "bandosa01", "bandosa01", "bandosa01", "bandosa01", "bandosa01", "bandosa01", "bandosa01", "holtzke01", "holtzke01", "holtzke01", "holtzke01", "holtzke01", "holtzke01", "holtzke01", "holtzke01", "holtzke01", "holtzke01", "holtzke01", "holtzke01", "holtzke01", "holtzke01", "holtzke01", "holtzke01", "holtzke01", "evansda01", "evansda01",
+#> "evansda01", "evansda01", "evansda01", "evansda01", "evansda01", "evansda01", "evansda01", "evansda01", "evansda01", "evansda01", "evansda01", "evansda01", "evansda01", "evansda01", "evansda01", "evansda01", "evansda01", "evansda01", "evansda01", "evansda01", "bryanro01", "bryanro01", "bryanro01", "bryanro01", "bryanro01", "bryanro01", "bryanro01", "bryanro01", "russebi01", "russebi01", "russebi01", "russebi01", "russebi01", "russebi01", "russebi01", "russebi01", "russebi01", "russebi01", "russebi01",
+#> "russebi01", "russebi01", "russebi01", "russebi01", "russebi01", "russebi01", "russebi01", "marshmi01", "marshmi01", "marshmi01", "marshmi01", "marshmi01", "marshmi01", "marshmi01", "marshmi01", "marshmi01", "marshmi01", "marshmi01", "marshmi01", "marshmi01", "marshmi01", "marshmi01", "marshmi01", "marshmi01", "garvest01", "garvest01", "garvest01", "garvest01", "garvest01", "garvest01", "garvest01", "garvest01", "garvest01", "garvest01", "garvest01", "garvest01", "garvest01", "garvest01", "garvest01",
+#> "garvest01", "garvest01", "garvest01", "garvest01", "greendi01", "greendi01", "greendi01", "greendi01", "greendi01", "greendi01", "greendi01", "greendi01", "greendi01", "greendi01", "greendi01", "greendi01", "hunteca01", "hunteca01", "hunteca01", "hunteca01", "hunteca01", "hunteca01", "hunteca01", "hunteca01", "hunteca01", "hunteca01", "hunteca01", "hunteca01", "hunteca01", "hunteca01", "hunteca01", "geronce01", "geronce01", "geronce01", "geronce01", "geronce01", "geronce01", "geronce01", "geronce01",
+#> "geronce01", "geronce01", "geronce01", "geronce01", "geronce01", "geronce01", "geronce01", "messean01", "messean01", "messean01", "messean01", "messean01", "messean01", "messean01", "messean01", "messean01", "messean01", "messean01", "messean01", "conceda01", "conceda01", "conceda01", "conceda01", "conceda01", "conceda01", "conceda01", "conceda01", "conceda01", "conceda01", "conceda01", "conceda01", "conceda01", "conceda01", "conceda01", "conceda01", "conceda01", "conceda01", "conceda01", "thompda01",
+#> "thompda01", "thompda01", "thompda01", "thompda01", "thompda01", "thompda01", "thompda01", "burroje01", "burroje01", "burroje01", "burroje01", "burroje01", "burroje01", "burroje01", "burroje01", "burroje01", "burroje01", "burroje01", "burroje01", "burroje01", "burroje01", "burroje01", "burroje01", "hargrmi01", "hargrmi01", "hargrmi01", "hargrmi01", "hargrmi01", "hargrmi01", "hargrmi01", "hargrmi01", "hargrmi01", "hargrmi01", "hargrmi01", "hargrmi01", "hargrmi01", "mcbriba01", "mcbriba01", "mcbriba01",
+#> "mcbriba01", "mcbriba01", "mcbriba01", "mcbriba01", "mcbriba01", "mcbriba01", "mcbriba01", "mcbriba01", "mcbriba01", "schmimi01", "schmimi01", "schmimi01", "schmimi01", "schmimi01", "schmimi01", "schmimi01", "schmimi01", "schmimi01", "schmimi01", "schmimi01", "schmimi01", "schmimi01", "schmimi01", "schmimi01", "schmimi01", "schmimi01", "schmimi01", "gulledo01", "gulledo01", "gulledo01", "gulledo01", "gulledo01", "gulledo01", "gulledo01", "gulledo01", "gulledo01", "ziskri01", "ziskri01", "ziskri01",
+#> "ziskri01", "ziskri01", "ziskri01", "ziskri01", "ziskri01", "ziskri01", "ziskri01", "ziskri01", "ziskri01", "ziskri01", "forstte01", "forstte01", "forstte01", "forstte01", "forstte01", "forstte01", "forstte01", "forstte01", "forstte01", "forstte01", "forstte01", "forstte01", "forstte01", "forstte01", "forstte01", "forstte01", "fingero01", "fingero01", "fingero01", "fingero01", "fingero01", "fingero01", "fingero01", "fingero01", "fingero01", "fingero01", "fingero01", "fingero01", "fingero01", "fingero01",
+#> "fingero01", "fingero01", "fingero01", "madlobi01", "madlobi01", "madlobi01", "madlobi01", "madlobi01", "madlobi01", "madlobi01", "madlobi01", "madlobi01", "madlobi01", "madlobi01", "madlobi01", "madlobi01", "madlobi01", "madlobi01", "madlobi01", "madlobi01", "madlobi01", "tiantlu01", "tiantlu01", "tiantlu01", "tiantlu01", "tiantlu01", "tiantlu01", "tiantlu01", "tiantlu01", "tiantlu01", "tiantlu01", "tiantlu01", "tiantlu01", "tiantlu01", "tiantlu01", "tiantlu01", "tiantlu01", "tiantlu01", "tiantlu01",
+#> "tiantlu01", "lynnfr01", "lynnfr01", "lynnfr01", "lynnfr01", "lynnfr01", "lynnfr01", "lynnfr01", "lynnfr01", "lynnfr01", "lynnfr01", "lynnfr01", "lynnfr01", "lynnfr01", "lynnfr01", "lynnfr01", "lynnfr01", "lynnfr01", "lynnfr01", "reitzke01", "reitzke01", "reitzke01", "reitzke01", "reitzke01", "reitzke01", "reitzke01", "reitzke01", "reitzke01", "reitzke01", "reitzke01", "maddoga01", "maddoga01", "maddoga01", "maddoga01", "maddoga01", "maddoga01", "maddoga01", "maddoga01", "maddoga01", "maddoga01",
+#> "maddoga01", "maddoga01", "maddoga01", "maddoga01", "maddoga01", "maddoga01", "nolanga01", "nolanga01", "nolanga01", "nolanga01", "nolanga01", "nolanga01", "nolanga01", "nolanga01", "nolanga01", "nolanga01", "nolanga01", "montejo01", "montejo01", "montejo01", "montejo01", "montejo01", "montejo01", "montejo01", "montejo01", "montejo01", "montejo01", "montejo01", "montejo01", "montejo01", "montejo01", "nettlgr01", "nettlgr01", "nettlgr01", "nettlgr01", "nettlgr01", "nettlgr01", "nettlgr01", "nettlgr01",
+#> "nettlgr01", "nettlgr01", "nettlgr01", "nettlgr01", "nettlgr01", "nettlgr01", "nettlgr01", "nettlgr01", "nettlgr01", "nettlgr01", "nettlgr01", "nettlgr01", "nettlgr01", "nettlgr01", "riceji01", "riceji01", "riceji01", "riceji01", "riceji01", "riceji01", "riceji01", "riceji01", "riceji01", "riceji01", "riceji01", "riceji01", "riceji01", "riceji01", "riceji01", "riceji01", "harrato01", "harrato01", "harrato01", "harrato01", "harrato01", "harrato01", "harrato01", "harrato01", "harrato01", "harrato01",
+#> "harrato01", "harrato01", "harrato01", "harrato01", "harrato01", "harrato01", "harrato01", "jonesra01", "jonesra01", "jonesra01", "jonesra01", "jonesra01", "jonesra01", "jonesra01", "jonesra01", "jonesra01", "jonesra01", "luzingr01", "luzingr01", "luzingr01", "luzingr01", "luzingr01", "luzingr01", "luzingr01", "luzingr01", "luzingr01", "luzingr01", "luzingr01", "luzingr01", "luzingr01", "luzingr01", "luzingr01", "oliveal01", "oliveal01", "oliveal01", "oliveal01", "oliveal01", "oliveal01", "oliveal01",
+#> "oliveal01", "oliveal01", "oliveal01", "oliveal01", "oliveal01", "oliveal01", "oliveal01", "oliveal01", "oliveal01", "oliveal01", "oliveal01", "oliveal01", "oliveal01", "parkeda01", "parkeda01", "parkeda01", "parkeda01", "parkeda01", "parkeda01", "parkeda01", "parkeda01", "parkeda01", "parkeda01", "parkeda01", "parkeda01", "parkeda01", "parkeda01", "parkeda01", "parkeda01", "parkeda01", "parkeda01", "parkeda01", "parkeda01", "gossari01", "gossari01", "gossari01", "gossari01", "gossari01", "gossari01",
+#> "gossari01", "gossari01", "gossari01", "gossari01", "gossari01", "gossari01", "gossari01", "gossari01", "gossari01", "gossari01", "gossari01", "gossari01", "gossari01", "gossari01", "gossari01", "gossari01", "gossari01", "hraboal01", "hraboal01", "hraboal01", "hraboal01", "hraboal01", "hraboal01", "hraboal01", "hraboal01", "hraboal01", "hraboal01", "hraboal01", "hraboal01", "hraboal01", "fostege01", "fostege01", "fostege01", "fostege01", "fostege01", "fostege01", "fostege01", "fostege01", "fostege01",
+#> "fostege01", "fostege01", "fostege01", "fostege01", "fostege01", "fostege01", "fostege01", "fostege01", "fostege01", "fostege01", "fostege01", "rodriau01", "rodriau01", "rodriau01", "rodriau01", "rodriau01", "rodriau01", "rodriau01", "rodriau01", "rodriau01", "rodriau01", "rodriau01", "rodriau01", "rodriau01", "rodriau01", "rodriau01", "rodriau01", "rodriau01", "rodriau01", "rodriau01", "rodriau01", "sundbji01", "sundbji01", "sundbji01", "sundbji01", "sundbji01", "sundbji01", "sundbji01", "sundbji01",
+#> "sundbji01", "sundbji01", "sundbji01", "sundbji01", "sundbji01", "sundbji01", "sundbji01", "sundbji01", "sundbji01", "evansdw01", "evansdw01", "evansdw01", "evansdw01", "evansdw01", "evansdw01", "evansdw01", "evansdw01", "evansdw01", "evansdw01", "evansdw01", "evansdw01", "evansdw01", "evansdw01", "evansdw01", "evansdw01", "evansdw01", "evansdw01", "evansdw01", "evansdw01", "manniri01", "manniri01", "manniri01", "manniri01", "manniri01", "manniri01", "manniri01", "manniri01", "manniri01", "manniri01",
+#> "manniri01", "manniri01", "manniri01", "manniri01", "johnto01", "johnto01", "johnto01", "johnto01", "johnto01", "johnto01", "johnto01", "johnto01", "johnto01", "johnto01", "johnto01", "johnto01", "johnto01", "johnto01", "johnto01", "johnto01", "johnto01", "johnto01", "johnto01", "johnto01", "johnto01", "johnto01", "johnto01", "johnto01", "johnto01", "johnto01", "johnto01", "johnto01", "suttodo01", "suttodo01", "suttodo01", "suttodo01", "suttodo01", "suttodo01", "suttodo01", "suttodo01", "suttodo01",
+#> "suttodo01", "suttodo01", "suttodo01", "suttodo01", "suttodo01", "suttodo01", "suttodo01", "suttodo01", "suttodo01", "suttodo01", "suttodo01", "suttodo01", "suttodo01", "suttodo01", "suttodo01", "suttodo01", "campbbi02", "campbbi02", "campbbi02", "campbbi02", "campbbi02", "campbbi02", "campbbi02", "campbbi02", "campbbi02", "campbbi02", "campbbi02", "campbbi02", "campbbi02", "campbbi02", "campbbi02", "eastwra01", "eastwra01", "eastwra01", "eastwra01", "eastwra01", "eastwra01", "eastwra01", "eastwra01",
+#> "eastwra01", "eastwra01", "fidryma01", "fidryma01", "fidryma01", "fidryma01", "fidryma01", "metzgbu01", "metzgbu01", "metzgbu01", "metzgbu01", "metzgbu01", "metzgbu01", "zachrpa01", "zachrpa01", "zachrpa01", "zachrpa01", "zachrpa01", "zachrpa01", "zachrpa01", "zachrpa01", "zachrpa01", "zachrpa01", "zachrpa01", "brettge01", "brettge01", "brettge01", "brettge01", "brettge01", "brettge01", "brettge01", "brettge01", "brettge01", "brettge01", "brettge01", "brettge01", "brettge01", "brettge01", "brettge01",
+#> "brettge01", "brettge01", "brettge01", "brettge01", "brettge01", "brettge01", "mcraeha01", "mcraeha01", "mcraeha01", "mcraeha01", "mcraeha01", "mcraeha01", "mcraeha01", "mcraeha01", "mcraeha01", "mcraeha01", "mcraeha01", "mcraeha01", "mcraeha01", "mcraeha01", "mcraeha01", "mcraeha01", "mcraeha01", "mcraeha01", "mcraeha01", "tananfr01", "tananfr01", "tananfr01", "tananfr01", "tananfr01", "tananfr01", "tananfr01", "tananfr01", "tananfr01", "tananfr01", "tananfr01", "tananfr01", "tananfr01", "tananfr01",
+#> "tananfr01", "tananfr01", "tananfr01", "tananfr01", "tananfr01", "tananfr01", "tananfr01", "tananfr01", "tananfr01", "rivermi01", "rivermi01", "rivermi01", "rivermi01", "rivermi01", "rivermi01", "rivermi01", "rivermi01", "rivermi01", "rivermi01", "rivermi01", "rivermi01", "rivermi01", "rivermi01", "rivermi01", "rivermi01", "montawi01", "montawi01", "montawi01", "montawi01", "montawi01", "montawi01", "montawi01", "montawi01", "montawi01", "montawi01", "montawi01", "montawi01", "montawi01", "montawi01",
+#> "montawi01", "montawi01", "montawi01", "montawi01", "montawi01", "montawi01", "boonebo01", "boonebo01", "boonebo01", "boonebo01", "boonebo01", "boonebo01", "boonebo01", "boonebo01", "boonebo01", "boonebo01", "boonebo01", "boonebo01", "boonebo01", "boonebo01", "boonebo01", "boonebo01", "boonebo01", "boonebo01", "boonebo01", "griffke01", "griffke01", "griffke01", "griffke01", "griffke01", "griffke01", "griffke01", "griffke01", "griffke01", "griffke01", "griffke01", "griffke01", "griffke01", "griffke01",
+#> "griffke01", "griffke01", "griffke01", "griffke01", "griffke01", "griffke01", "griffke01", "griffke01", "whitefr01", "whitefr01", "whitefr01", "whitefr01", "whitefr01", "whitefr01", "whitefr01", "whitefr01", "whitefr01", "whitefr01", "whitefr01", "whitefr01", "whitefr01", "whitefr01", "whitefr01", "whitefr01", "whitefr01", "whitefr01", "beniqju01", "beniqju01", "beniqju01", "beniqju01", "beniqju01", "beniqju01", "beniqju01", "beniqju01", "beniqju01", "beniqju01", "beniqju01", "beniqju01", "beniqju01",
+#> "beniqju01", "beniqju01", "beniqju01", "beniqju01", "beniqju01", "cowenal01", "cowenal01", "cowenal01", "cowenal01", "cowenal01", "cowenal01", "cowenal01", "cowenal01", "cowenal01", "cowenal01", "cowenal01", "cowenal01", "cowenal01", "cowenal01", "bakerdu01", "bakerdu01", "bakerdu01", "bakerdu01", "bakerdu01", "bakerdu01", "bakerdu01", "bakerdu01", "bakerdu01", "bakerdu01", "bakerdu01", "bakerdu01", "bakerdu01", "bakerdu01", "bakerdu01", "bakerdu01", "bakerdu01", "bakerdu01", "bakerdu01", "murraed02",
+#> "murraed02", "murraed02", "murraed02", "murraed02", "murraed02", "murraed02", "murraed02", "murraed02", "murraed02", "murraed02", "murraed02", "murraed02", "murraed02", "murraed02", "murraed02", "murraed02", "murraed02", "murraed02", "murraed02", "murraed02", "murraed02", "murraed02", "dawsoan01", "dawsoan01", "dawsoan01", "dawsoan01", "dawsoan01", "dawsoan01", "dawsoan01", "dawsoan01", "dawsoan01", "dawsoan01", "dawsoan01", "dawsoan01", "dawsoan01", "dawsoan01", "dawsoan01", "dawsoan01", "dawsoan01",
+#> "dawsoan01", "dawsoan01", "dawsoan01", "dawsoan01", "randowi01", "randowi01", "randowi01", "randowi01", "randowi01", "randowi01", "randowi01", "randowi01", "randowi01", "randowi01", "randowi01", "randowi01", "randowi01", "randowi01", "randowi01", "randowi01", "randowi01", "randowi01", "randowi01", "hislela01", "hislela01", "hislela01", "hislela01", "hislela01", "hislela01", "hislela01", "hislela01", "hislela01", "hislela01", "hislela01", "hislela01", "hislela01", "hislela01", "ryanno01", "ryanno01",
+#> "ryanno01", "ryanno01", "ryanno01", "ryanno01", "ryanno01", "ryanno01", "ryanno01", "ryanno01", "ryanno01", "ryanno01", "ryanno01", "ryanno01", "ryanno01", "ryanno01", "ryanno01", "ryanno01", "ryanno01", "ryanno01", "ryanno01", "ryanno01", "ryanno01", "ryanno01", "ryanno01", "ryanno01", "ryanno01", "burleri01", "burleri01", "burleri01", "burleri01", "burleri01", "burleri01", "burleri01", "burleri01", "burleri01", "burleri01", "burleri01", "burleri01", "burleri01", "simmote01", "simmote01", "simmote01",
+#> "simmote01", "simmote01", "simmote01", "simmote01", "simmote01", "simmote01", "simmote01", "simmote01", "simmote01", "simmote01", "simmote01", "simmote01", "simmote01", "simmote01", "simmote01", "simmote01", "simmote01", "simmote01", "reuscri01", "reuscri01", "reuscri01", "reuscri01", "reuscri01", "reuscri01", "reuscri01", "reuscri01", "reuscri01", "reuscri01", "reuscri01", "reuscri01", "reuscri01", "reuscri01", "reuscri01", "reuscri01", "reuscri01", "reuscri01", "reuscri01", "reuscri01", "reuscri01",
+#> "templga01", "templga01", "templga01", "templga01", "templga01", "templga01", "templga01", "templga01", "templga01", "templga01", "templga01", "templga01", "templga01", "templga01", "templga01", "templga01", "templga01", "dentbu01", "dentbu01", "dentbu01", "dentbu01", "dentbu01", "dentbu01", "dentbu01", "dentbu01", "dentbu01", "dentbu01", "dentbu01", "dentbu01", "dentbu01", "guidrro01", "guidrro01", "guidrro01", "guidrro01", "guidrro01", "guidrro01", "guidrro01", "guidrro01", "guidrro01", "guidrro01",
+#> "guidrro01", "guidrro01", "guidrro01", "guidrro01", "milleri01", "milleri01", "milleri01", "milleri01", "milleri01", "milleri01", "milleri01", "milleri01", "milleri01", "milleri01", "milleri01", "milleri01", "milleri01", "milleri01", "milleri01", "hernake01", "hernake01", "hernake01", "hernake01", "hernake01", "hernake01", "hernake01", "hernake01", "hernake01", "hernake01", "hernake01", "hernake01", "hernake01", "hernake01", "hernake01", "hernake01", "hernake01", "hernake01", "lopesda01", "lopesda01",
+#> "lopesda01", "lopesda01", "lopesda01", "lopesda01", "lopesda01", "lopesda01", "lopesda01", "lopesda01", "lopesda01", "lopesda01", "lopesda01", "lopesda01", "lopesda01", "lopesda01", "lopesda01", "lopesda01", "valenel01", "valenel01", "valenel01", "valenel01", "valenel01", "valenel01", "valenel01", "valenel01", "valenel01", "valenel01", "valenel01", "niekrph01", "niekrph01", "niekrph01", "niekrph01", "niekrph01", "niekrph01", "niekrph01", "niekrph01", "niekrph01", "niekrph01", "niekrph01", "niekrph01",
+#> "niekrph01", "niekrph01", "niekrph01", "niekrph01", "niekrph01", "niekrph01", "niekrph01", "niekrph01", "niekrph01", "niekrph01", "niekrph01", "niekrph01", "niekrph01", "niekrph01", "whitalo01", "whitalo01", "whitalo01", "whitalo01", "whitalo01", "whitalo01", "whitalo01", "whitalo01", "whitalo01", "whitalo01", "whitalo01", "whitalo01", "whitalo01", "whitalo01", "whitalo01", "whitalo01", "whitalo01", "whitalo01", "whitalo01", "hornebo01", "hornebo01", "hornebo01", "hornebo01", "hornebo01", "hornebo01",
+#> "hornebo01", "hornebo01", "hornebo01", "hornebo01", "staubru01", "staubru01", "staubru01", "staubru01", "staubru01", "staubru01", "staubru01", "staubru01", "staubru01", "staubru01", "staubru01", "staubru01", "staubru01", "staubru01", "staubru01", "staubru01", "staubru01", "staubru01", "staubru01", "staubru01", "staubru01", "staubru01", "staubru01", "staubru01", "yountro01", "yountro01", "yountro01", "yountro01", "yountro01", "yountro01", "yountro01", "yountro01", "yountro01", "yountro01", "yountro01",
+#> "yountro01", "yountro01", "yountro01", "yountro01", "yountro01", "yountro01", "yountro01", "yountro01", "yountro01", "clarkja01", "clarkja01", "clarkja01", "clarkja01", "clarkja01", "clarkja01", "clarkja01", "clarkja01", "clarkja01", "clarkja01", "clarkja01", "clarkja01", "clarkja01", "clarkja01", "clarkja01", "clarkja01", "clarkja01", "clarkja01", "flanami01", "flanami01", "flanami01", "flanami01", "flanami01", "flanami01", "flanami01", "flanami01", "flanami01", "flanami01", "flanami01", "flanami01",
+#> "flanami01", "flanami01", "flanami01", "flanami01", "flanami01", "flanami01", "flanami01", "suttebr01", "suttebr01", "suttebr01", "suttebr01", "suttebr01", "suttebr01", "suttebr01", "suttebr01", "suttebr01", "suttebr01", "suttebr01", "suttebr01", "coopece01", "coopece01", "coopece01", "coopece01", "coopece01", "coopece01", "coopece01", "coopece01", "coopece01", "coopece01", "coopece01", "coopece01", "coopece01", "coopece01", "coopece01", "coopece01", "coopece01", "bellbu01", "bellbu01", "bellbu01",
+#> "bellbu01", "bellbu01", "bellbu01", "bellbu01", "bellbu01", "bellbu01", "bellbu01", "bellbu01", "bellbu01", "bellbu01", "bellbu01", "bellbu01", "bellbu01", "bellbu01", "bellbu01", "bellbu01", "bellbu01", "lezcasi01", "lezcasi01", "lezcasi01", "lezcasi01", "lezcasi01", "lezcasi01", "lezcasi01", "lezcasi01", "lezcasi01", "lezcasi01", "lezcasi01", "lezcasi01", "lezcasi01", "trillma01", "trillma01", "trillma01", "trillma01", "trillma01", "trillma01", "trillma01", "trillma01", "trillma01", "trillma01",
+#> "trillma01", "trillma01", "trillma01", "trillma01", "trillma01", "trillma01", "trillma01", "trillma01", "winfida01", "winfida01", "winfida01", "winfida01", "winfida01", "winfida01", "winfida01", "winfida01", "winfida01", "winfida01", "winfida01", "winfida01", "winfida01", "winfida01", "winfida01", "winfida01", "winfida01", "winfida01", "winfida01", "winfida01", "winfida01", "winfida01", "winfida01", "baylodo01", "baylodo01", "baylodo01", "baylodo01", "baylodo01", "baylodo01", "baylodo01", "baylodo01",
+#> "baylodo01", "baylodo01", "baylodo01", "baylodo01", "baylodo01", "baylodo01", "baylodo01", "baylodo01", "baylodo01", "baylodo01", "baylodo01", "baylodo01", "thornan01", "thornan01", "thornan01", "thornan01", "thornan01", "thornan01", "thornan01", "thornan01", "thornan01", "thornan01", "thornan01", "thornan01", "thornan01", "thornan01", "thornan01", "kernji01", "kernji01", "kernji01", "kernji01", "kernji01", "kernji01", "kernji01", "kernji01", "kernji01", "kernji01", "kernji01", "kernji01", "kernji01",
+#> "kernji01", "kernji01", "castijo01", "castijo01", "castijo01", "castijo01", "castijo01", "castijo01", "griffal01", "griffal01", "griffal01", "griffal01", "griffal01", "griffal01", "griffal01", "griffal01", "griffal01", "griffal01", "griffal01", "griffal01", "griffal01", "griffal01", "griffal01", "griffal01", "griffal01", "griffal01", "sutclri01", "sutclri01", "sutclri01", "sutclri01", "sutclri01", "sutclri01", "sutclri01", "sutclri01", "sutclri01", "sutclri01", "sutclri01", "sutclri01", "sutclri01",
+#> "sutclri01", "sutclri01", "sutclri01", "sutclri01", "sutclri01", "sutclri01", "porteda02", "porteda02", "porteda02", "porteda02", "porteda02", "porteda02", "porteda02", "porteda02", "porteda02", "porteda02", "porteda02", "porteda02", "porteda02", "porteda02", "porteda02", "porteda02", "porteda02", "singlke01", "singlke01", "singlke01", "singlke01", "singlke01", "singlke01", "singlke01", "singlke01", "singlke01", "singlke01", "singlke01", "singlke01", "singlke01", "singlke01", "singlke01", "smallro02",
+#> "smallro02", "smallro02", "smallro02", "smallro02", "smallro02", "smallro02", "smallro02", "smallro02", "smallro02", "smallro02", "smallro02", "smallro02", "smallro02", "smallro02", "smallro02", "kingmda01", "kingmda01", "kingmda01", "kingmda01", "kingmda01", "kingmda01", "kingmda01", "kingmda01", "kingmda01", "kingmda01", "kingmda01", "kingmda01", "kingmda01", "kingmda01", "kingmda01", "kingmda01", "kingmda01", "kingmda01", "kingmda01", "morenom01", "morenom01", "morenom01", "morenom01", "morenom01",
+#> "morenom01", "morenom01", "morenom01", "morenom01", "morenom01", "morenom01", "morenom01", "morenom01", "morenom01", "niekrjo01", "niekrjo01", "niekrjo01", "niekrjo01", "niekrjo01", "niekrjo01", "niekrjo01", "niekrjo01", "niekrjo01", "niekrjo01", "niekrjo01", "niekrjo01", "niekrjo01", "niekrjo01", "niekrjo01", "niekrjo01", "niekrjo01", "niekrjo01", "niekrjo01", "niekrjo01", "niekrjo01", "niekrjo01", "niekrjo01", "niekrjo01", "niekrjo01", "mcgratu01", "mcgratu01", "mcgratu01", "mcgratu01", "mcgratu01",
+#> "mcgratu01", "mcgratu01", "mcgratu01", "mcgratu01", "mcgratu01", "mcgratu01", "mcgratu01", "mcgratu01", "mcgratu01", "mcgratu01", "mcgratu01", "mcgratu01", "mcgratu01", "mcgratu01", "stonest01", "stonest01", "stonest01", "stonest01", "stonest01", "stonest01", "stonest01", "stonest01", "stonest01", "stonest01", "stonest01", "murphdw01", "murphdw01", "murphdw01", "murphdw01", "murphdw01", "murphdw01", "murphdw01", "murphdw01", "murphdw01", "murphdw01", "murphdw01", "murphdw01", "wilsowi02", "wilsowi02",
+#> "wilsowi02", "wilsowi02", "wilsowi02", "wilsowi02", "wilsowi02", "wilsowi02", "wilsowi02", "wilsowi02", "wilsowi02", "wilsowi02", "wilsowi02", "wilsowi02", "wilsowi02", "wilsowi02", "wilsowi02", "wilsowi02", "wilsowi02", "norrimi01", "norrimi01", "norrimi01", "norrimi01", "norrimi01", "norrimi01", "norrimi01", "norrimi01", "norrimi01", "norrimi01", "trammal01", "trammal01", "trammal01", "trammal01", "trammal01", "trammal01", "trammal01", "trammal01", "trammal01", "trammal01", "trammal01", "trammal01",
+#> "trammal01", "trammal01", "trammal01", "trammal01", "trammal01", "trammal01", "trammal01", "trammal01", "flynndo01", "flynndo01", "flynndo01", "flynndo01", "flynndo01", "flynndo01", "flynndo01", "flynndo01", "flynndo01", "flynndo01", "flynndo01", "flynndo01", "flynndo01", "flynndo01", "cartega01", "cartega01", "cartega01", "cartega01", "cartega01", "cartega01", "cartega01", "cartega01", "cartega01", "cartega01", "cartega01", "cartega01", "cartega01", "cartega01", "cartega01", "cartega01", "cartega01",
+#> "cartega01", "cartega01", "smithoz01", "smithoz01", "smithoz01", "smithoz01", "smithoz01", "smithoz01", "smithoz01", "smithoz01", "smithoz01", "smithoz01", "smithoz01", "smithoz01", "smithoz01", "smithoz01", "smithoz01", "smithoz01", "smithoz01", "smithoz01", "smithoz01", "quiseda01", "quiseda01", "quiseda01", "quiseda01", "quiseda01", "quiseda01", "quiseda01", "quiseda01", "quiseda01", "quiseda01", "quiseda01", "quiseda01", "quiseda01", "charbjo01", "charbjo01", "charbjo01", "howest01", "howest01",
+#> "howest01", "howest01", "howest01", "howest01", "howest01", "howest01", "howest01", "howest01", "howest01", "howest01", "howest01", "parrila02", "parrila02", "parrila02", "parrila02", "parrila02", "parrila02", "parrila02", "parrila02", "parrila02", "parrila02", "parrila02", "parrila02", "parrila02", "parrila02", "parrila02", "parrila02", "parrila02", "parrila02", "parrila02", "parrila02", "oglivbe01", "oglivbe01", "oglivbe01", "oglivbe01", "oglivbe01", "oglivbe01", "oglivbe01", "oglivbe01", "oglivbe01",
+#> "oglivbe01", "oglivbe01", "oglivbe01", "oglivbe01", "oglivbe01", "oglivbe01", "oglivbe01", "hendrge01", "hendrge01", "hendrge01", "hendrge01", "hendrge01", "hendrge01", "hendrge01", "hendrge01", "hendrge01", "hendrge01", "hendrge01", "hendrge01", "hendrge01", "hendrge01", "hendrge01", "hendrge01", "hendrge01", "hendrge01", "hendrge01", "hendrge01", "forscbo01", "forscbo01", "forscbo01", "forscbo01", "forscbo01", "forscbo01", "forscbo01", "forscbo01", "forscbo01", "forscbo01", "forscbo01", "forscbo01",
+#> "forscbo01", "forscbo01", "forscbo01", "forscbo01", "forscbo01", "ceronri01", "ceronri01", "ceronri01", "ceronri01", "ceronri01", "ceronri01", "ceronri01", "ceronri01", "ceronri01", "ceronri01", "ceronri01", "ceronri01", "ceronri01", "ceronri01", "ceronri01", "ceronri01", "ceronri01", "ceronri01", "bibbyji01", "bibbyji01", "bibbyji01", "bibbyji01", "bibbyji01", "bibbyji01", "bibbyji01", "bibbyji01", "bibbyji01", "bibbyji01", "bibbyji01", "bibbyji01", "bibbyji01", "bibbyji01", "humeto01", "humeto01",
+#> "humeto01", "humeto01", "humeto01", "humeto01", "humeto01", "humeto01", "humeto01", "humeto01", "humeto01", "humeto01", "ceyro01", "ceyro01", "ceyro01", "ceyro01", "ceyro01", "ceyro01", "ceyro01", "ceyro01", "ceyro01", "ceyro01", "ceyro01", "ceyro01", "ceyro01", "ceyro01", "ceyro01", "ceyro01", "ceyro01", "valenfe01", "valenfe01", "valenfe01", "valenfe01", "valenfe01", "valenfe01", "valenfe01", "valenfe01", "valenfe01", "valenfe01", "valenfe01", "valenfe01", "valenfe01", "valenfe01", "valenfe01",
+#> "valenfe01", "valenfe01", "valenfe01", "squirmi01", "squirmi01", "squirmi01", "squirmi01", "squirmi01", "squirmi01", "squirmi01", "squirmi01", "squirmi01", "squirmi01", "henderi01", "henderi01", "henderi01", "henderi01", "henderi01", "henderi01", "henderi01", "henderi01", "henderi01", "henderi01", "henderi01", "henderi01", "henderi01", "henderi01", "henderi01", "henderi01", "henderi01", "henderi01", "henderi01", "henderi01", "henderi01", "henderi01", "henderi01", "henderi01", "henderi01", "henderi01",
+#> "henderi01", "henderi01", "henderi01", "hootobu01", "hootobu01", "hootobu01", "hootobu01", "hootobu01", "hootobu01", "hootobu01", "hootobu01", "hootobu01", "hootobu01", "hootobu01", "hootobu01", "hootobu01", "hootobu01", "hootobu01", "hootobu01", "righeda01", "righeda01", "righeda01", "righeda01", "righeda01", "righeda01", "righeda01", "righeda01", "righeda01", "righeda01", "righeda01", "righeda01", "righeda01", "righeda01", "righeda01", "righeda01", "righeda01", "lansfca01", "lansfca01", "lansfca01",
+#> "lansfca01", "lansfca01", "lansfca01", "lansfca01", "lansfca01", "lansfca01", "lansfca01", "lansfca01", "lansfca01", "lansfca01", "lansfca01", "lansfca01", "armasto01", "armasto01", "armasto01", "armasto01", "armasto01", "armasto01", "armasto01", "armasto01", "armasto01", "armasto01", "armasto01", "armasto01", "armasto01", "armasto01", "morrija02", "morrija02", "morrija02", "morrija02", "morrija02", "morrija02", "morrija02", "morrija02", "morrija02", "morrija02", "morrija02", "morrija02", "morrija02",
+#> "morrija02", "morrija02", "morrija02", "morrija02", "morrija02", "guerrpe01", "guerrpe01", "guerrpe01", "guerrpe01", "guerrpe01", "guerrpe01", "guerrpe01", "guerrpe01", "guerrpe01", "guerrpe01", "guerrpe01", "guerrpe01", "guerrpe01", "guerrpe01", "guerrpe01", "guerrpe01", "yeagest01", "yeagest01", "yeagest01", "yeagest01", "yeagest01", "yeagest01", "yeagest01", "yeagest01", "yeagest01", "yeagest01", "yeagest01", "yeagest01", "yeagest01", "yeagest01", "yeagest01", "vuckope01", "vuckope01", "vuckope01",
+#> "vuckope01", "vuckope01", "vuckope01", "vuckope01", "vuckope01", "vuckope01", "vuckope01", "vuckope01", "murphda05", "murphda05", "murphda05", "murphda05", "murphda05", "murphda05", "murphda05", "murphda05", "murphda05", "murphda05", "murphda05", "murphda05", "murphda05", "murphda05", "murphda05", "murphda05", "murphda05", "murphda05", "murphda05", "ripkeca01", "ripkeca01", "ripkeca01", "ripkeca01", "ripkeca01", "ripkeca01", "ripkeca01", "ripkeca01", "ripkeca01", "ripkeca01", "ripkeca01", "ripkeca01",
+#> "ripkeca01", "ripkeca01", "ripkeca01", "ripkeca01", "ripkeca01", "ripkeca01", "ripkeca01", "ripkeca01", "ripkeca01", "saxst01", "saxst01", "saxst01", "saxst01", "saxst01", "saxst01", "saxst01", "saxst01", "saxst01", "saxst01", "saxst01", "saxst01", "saxst01", "saxst01", "garcida01", "garcida01", "garcida01", "garcida01", "garcida01", "garcida01", "garcida01", "garcida01", "garcida01", "garcida01", "garcida01", "decindo01", "decindo01", "decindo01", "decindo01", "decindo01", "decindo01", "decindo01",
+#> "decindo01", "decindo01", "decindo01", "decindo01", "decindo01", "decindo01", "decindo01", "decindo01", "decindo01", "durhale01", "durhale01", "durhale01", "durhale01", "durhale01", "durhale01", "durhale01", "durhale01", "durhale01", "durhale01", "durhale01", "robindo01", "robindo01", "robindo01", "robindo01", "robindo01", "robindo01", "robindo01", "robindo01", "robindo01", "robindo01", "robindo01", "robindo01", "robindo01", "robindo01", "robindo01", "robindo01", "robindo01", "zahnge01", "zahnge01",
+#> "zahnge01", "zahnge01", "zahnge01", "zahnge01", "zahnge01", "zahnge01", "zahnge01", "zahnge01", "zahnge01", "zahnge01", "zahnge01", "zahnge01", "thomago01", "thomago01", "thomago01", "thomago01", "thomago01", "thomago01", "thomago01", "thomago01", "thomago01", "thomago01", "thomago01", "thomago01", "thomago01", "thomago01", "thomago01", "stiebda01", "stiebda01", "stiebda01", "stiebda01", "stiebda01", "stiebda01", "stiebda01", "stiebda01", "stiebda01", "stiebda01", "stiebda01", "stiebda01", "stiebda01",
+#> "stiebda01", "stiebda01", "stiebda01", "smithlo01", "smithlo01", "smithlo01", "smithlo01", "smithlo01", "smithlo01", "smithlo01", "smithlo01", "smithlo01", "smithlo01", "smithlo01", "smithlo01", "smithlo01", "smithlo01", "smithlo01", "smithlo01", "smithlo01", "smithlo01", "smithlo01", "rogerst01", "rogerst01", "rogerst01", "rogerst01", "rogerst01", "rogerst01", "rogerst01", "rogerst01", "rogerst01", "rogerst01", "rogerst01", "rogerst01", "rogerst01", "boddimi01", "boddimi01", "boddimi01", "boddimi01",
+#> "boddimi01", "boddimi01", "boddimi01", "boddimi01", "boddimi01", "boddimi01", "boddimi01", "boddimi01", "boddimi01", "boddimi01", "boddimi01", "dempsri01", "dempsri01", "dempsri01", "dempsri01", "dempsri01", "dempsri01", "dempsri01", "dempsri01", "dempsri01", "dempsri01", "dempsri01", "dempsri01", "dempsri01", "dempsri01", "dempsri01", "dempsri01", "dempsri01", "dempsri01", "dempsri01", "dempsri01", "dempsri01", "dempsri01", "dempsri01", "dempsri01", "dempsri01", "hoytla01", "hoytla01", "hoytla01",
+#> "hoytla01", "hoytla01", "hoytla01", "hoytla01", "hoytla01", "dennyjo01", "dennyjo01", "dennyjo01", "dennyjo01", "dennyjo01", "dennyjo01", "dennyjo01", "dennyjo01", "dennyjo01", "dennyjo01", "dennyjo01", "dennyjo01", "dennyjo01", "dennyjo01", "sandbry01", "sandbry01", "sandbry01", "sandbry01", "sandbry01", "sandbry01", "sandbry01", "sandbry01", "sandbry01", "sandbry01", "sandbry01", "sandbry01", "sandbry01", "sandbry01", "sandbry01", "sandbry01", "penato01", "penato01", "penato01", "penato01", "penato01",
+#> "penato01", "penato01", "penato01", "penato01", "penato01", "penato01", "penato01", "penato01", "penato01", "penato01", "penato01", "penato01", "penato01", "penato01", "mcgeewi01", "mcgeewi01", "mcgeewi01", "mcgeewi01", "mcgeewi01", "mcgeewi01", "mcgeewi01", "mcgeewi01", "mcgeewi01", "mcgeewi01", "mcgeewi01", "mcgeewi01", "mcgeewi01", "mcgeewi01", "mcgeewi01", "mcgeewi01", "mcgeewi01", "mcgeewi01", "mcgeewi01", "knighra01", "knighra01", "knighra01", "knighra01", "knighra01", "knighra01", "knighra01",
+#> "knighra01", "knighra01", "knighra01", "knighra01", "knighra01", "knighra01", "knighra01", "hollaal01", "hollaal01", "hollaal01", "hollaal01", "hollaal01", "hollaal01", "hollaal01", "hollaal01", "hollaal01", "hollaal01", "hollaal01", "hollaal01", "kittlro01", "kittlro01", "kittlro01", "kittlro01", "kittlro01", "kittlro01", "kittlro01", "kittlro01", "kittlro01", "kittlro01", "kittlro01", "kittlro01", "strawda01", "strawda01", "strawda01", "strawda01", "strawda01", "strawda01", "strawda01", "strawda01",
+#> "strawda01", "strawda01", "strawda01", "strawda01", "strawda01", "strawda01", "strawda01", "strawda01", "strawda01", "boggswa01", "boggswa01", "boggswa01", "boggswa01", "boggswa01", "boggswa01", "boggswa01", "boggswa01", "boggswa01", "boggswa01", "boggswa01", "boggswa01", "boggswa01", "boggswa01", "boggswa01", "boggswa01", "boggswa01", "boggswa01", "mosebll01", "mosebll01", "mosebll01", "mosebll01", "mosebll01", "mosebll01", "mosebll01", "mosebll01", "mosebll01", "mosebll01", "mosebll01", "mosebll01",
+#> "rayjo01", "rayjo01", "rayjo01", "rayjo01", "rayjo01", "rayjo01", "rayjo01", "rayjo01", "rayjo01", "rayjo01", "rayjo01", "kennete02", "kennete02", "kennete02", "kennete02", "kennete02", "kennete02", "kennete02", "kennete02", "kennete02", "kennete02", "kennete02", "kennete02", "kennete02", "kennete02", "cruzjo01", "cruzjo01", "cruzjo01", "cruzjo01", "cruzjo01", "cruzjo01", "cruzjo01", "cruzjo01", "cruzjo01", "cruzjo01", "cruzjo01", "cruzjo01", "cruzjo01", "cruzjo01", "cruzjo01", "cruzjo01", "cruzjo01",
+#> "cruzjo01", "cruzjo01", "thondi01", "thondi01", "thondi01", "thondi01", "thondi01", "thondi01", "thondi01", "thondi01", "thondi01", "thondi01", "thondi01", "thondi01", "thondi01", "thondi01", "thondi01", "hubbagl01", "hubbagl01", "hubbagl01", "hubbagl01", "hubbagl01", "hubbagl01", "hubbagl01", "hubbagl01", "hubbagl01", "hubbagl01", "hubbagl01", "hubbagl01", "mcwilla01", "mcwilla01", "mcwilla01", "mcwilla01", "mcwilla01", "mcwilla01", "mcwilla01", "mcwilla01", "mcwilla01", "mcwilla01", "mcwilla01",
+#> "mcwilla01", "mcwilla01", "mcwilla01", "mcwilla01", "raineti01", "raineti01", "raineti01", "raineti01", "raineti01", "raineti01", "raineti01", "raineti01", "raineti01", "raineti01", "raineti01", "raineti01", "raineti01", "raineti01", "raineti01", "raineti01", "raineti01", "raineti01", "raineti01", "raineti01", "raineti01", "raineti01", "raineti01", "raineti01", "smithle02", "smithle02", "smithle02", "smithle02", "smithle02", "smithle02", "smithle02", "smithle02", "smithle02", "smithle02", "smithle02",
+#> "smithle02", "smithle02", "smithle02", "smithle02", "smithle02", "smithle02", "smithle02", "smithle02", "smithle02", "smithle02", "gibsoki01", "gibsoki01", "gibsoki01", "gibsoki01", "gibsoki01", "gibsoki01", "gibsoki01", "gibsoki01", "gibsoki01", "gibsoki01", "gibsoki01", "gibsoki01", "gibsoki01", "gibsoki01", "gibsoki01", "gibsoki01", "gibsoki01", "hernawi01", "hernawi01", "hernawi01", "hernawi01", "hernawi01", "hernawi01", "hernawi01", "hernawi01", "hernawi01", "hernawi01", "hernawi01", "hernawi01",
+#> "hernawi01", "hernawi01", "dernibo01", "dernibo01", "dernibo01", "dernibo01", "dernibo01", "dernibo01", "dernibo01", "dernibo01", "dernibo01", "dernibo01", "andujjo01", "andujjo01", "andujjo01", "andujjo01", "andujjo01", "andujjo01", "andujjo01", "andujjo01", "andujjo01", "andujjo01", "andujjo01", "andujjo01", "andujjo01", "andujjo01", "davisal01", "davisal01", "davisal01", "davisal01", "davisal01", "davisal01", "davisal01", "davisal01", "davisal01", "goodedw01", "goodedw01", "goodedw01", "goodedw01",
+#> "goodedw01", "goodedw01", "goodedw01", "goodedw01", "goodedw01", "goodedw01", "goodedw01", "goodedw01", "goodedw01", "goodedw01", "goodedw01", "goodedw01", "goodedw01", "goodedw01", "gwynnto01", "gwynnto01", "gwynnto01", "gwynnto01", "gwynnto01", "gwynnto01", "gwynnto01", "gwynnto01", "gwynnto01", "gwynnto01", "gwynnto01", "gwynnto01", "gwynnto01", "gwynnto01", "gwynnto01", "gwynnto01", "gwynnto01", "gwynnto01", "gwynnto01", "gwynnto01", "rhoderi01", "rhoderi01", "rhoderi01", "rhoderi01", "rhoderi01",
+#> "rhoderi01", "rhoderi01", "rhoderi01", "rhoderi01", "rhoderi01", "rhoderi01", "rhoderi01", "rhoderi01", "rhoderi01", "rhoderi01", "rhoderi01", "mattido01", "mattido01", "mattido01", "mattido01", "mattido01", "mattido01", "mattido01", "mattido01", "mattido01", "mattido01", "mattido01", "mattido01", "mattido01", "mattido01", "thurmma01", "thurmma01", "thurmma01", "thurmma01", "thurmma01", "thurmma01", "thurmma01", "thurmma01", "thurmma01", "saberbr01", "saberbr01", "saberbr01", "saberbr01", "saberbr01",
+#> "saberbr01", "saberbr01", "saberbr01", "saberbr01", "saberbr01", "saberbr01", "saberbr01", "saberbr01", "saberbr01", "saberbr01", "saberbr01", "saberbr01", "pettiga01", "pettiga01", "pettiga01", "pettiga01", "pettiga01", "pettiga01", "pettiga01", "pettiga01", "pettiga01", "pettiga01", "pettiga01", "pettiga01", "wallati01", "wallati01", "wallati01", "wallati01", "wallati01", "wallati01", "wallati01", "wallati01", "wallati01", "wallati01", "wallati01", "wallati01", "wallati01", "wallati01", "wallati01",
+#> "wallati01", "wallati01", "wallati01", "reardje01", "reardje01", "reardje01", "reardje01", "reardje01", "reardje01", "reardje01", "reardje01", "reardje01", "reardje01", "reardje01", "reardje01", "reardje01", "reardje01", "reardje01", "reardje01", "reardje01", "reardje01", "guilloz01", "guilloz01", "guilloz01", "guilloz01", "guilloz01", "guilloz01", "guilloz01", "guilloz01", "guilloz01", "guilloz01", "guilloz01", "guilloz01", "guilloz01", "guilloz01", "guilloz01", "guilloz01", "guilloz01", "colemvi01",
+#> "colemvi01", "colemvi01", "colemvi01", "colemvi01", "colemvi01", "colemvi01", "colemvi01", "colemvi01", "colemvi01", "colemvi01", "colemvi01", "colemvi01", "colemvi01", "bellge02", "bellge02", "bellge02", "bellge02", "bellge02", "bellge02", "bellge02", "bellge02", "bellge02", "bellge02", "bellge02", "bellge02", "brookhu01", "brookhu01", "brookhu01", "brookhu01", "brookhu01", "brookhu01", "brookhu01", "brookhu01", "brookhu01", "brookhu01", "brookhu01", "brookhu01", "brookhu01", "brookhu01", "brookhu01",
+#> "baineha01", "baineha01", "baineha01", "baineha01", "baineha01", "baineha01", "baineha01", "baineha01", "baineha01", "baineha01", "baineha01", "baineha01", "baineha01", "baineha01", "baineha01", "baineha01", "baineha01", "baineha01", "baineha01", "baineha01", "baineha01", "baineha01", "baineha01", "baineha01", "baineha01", "baineha01", "baineha01", "bradlph01", "bradlph01", "bradlph01", "bradlph01", "bradlph01", "bradlph01", "bradlph01", "bradlph01", "bradlph01", "herrto01", "herrto01", "herrto01",
+#> "herrto01", "herrto01", "herrto01", "herrto01", "herrto01", "herrto01", "herrto01", "herrto01", "herrto01", "herrto01", "herrto01", "herrto01", "herrto01", "tudorjo01", "tudorjo01", "tudorjo01", "tudorjo01", "tudorjo01", "tudorjo01", "tudorjo01", "tudorjo01", "tudorjo01", "tudorjo01", "tudorjo01", "tudorjo01", "tudorjo01", "barrema02", "barrema02", "barrema02", "barrema02", "barrema02", "barrema02", "barrema02", "barrema02", "barrema02", "barrema02", "clemero02", "clemero02", "clemero02", "clemero02",
+#> "clemero02", "clemero02", "clemero02", "clemero02", "clemero02", "clemero02", "clemero02", "clemero02", "clemero02", "clemero02", "clemero02", "clemero02", "clemero02", "clemero02", "clemero02", "clemero02", "clemero02", "clemero02", "clemero02", "clemero02", "scottmi03", "scottmi03", "scottmi03", "scottmi03", "scottmi03", "scottmi03", "scottmi03", "scottmi03", "scottmi03", "scottmi03", "scottmi03", "scottmi03", "scottmi03", "gaettga01", "gaettga01", "gaettga01", "gaettga01", "gaettga01", "gaettga01",
+#> "gaettga01", "gaettga01", "gaettga01", "gaettga01", "gaettga01", "gaettga01", "gaettga01", "gaettga01", "gaettga01", "gaettga01", "gaettga01", "gaettga01", "gaettga01", "gaettga01", "gaettga01", "gaettga01", "barfije01", "barfije01", "barfije01", "barfije01", "barfije01", "barfije01", "barfije01", "barfije01", "barfije01", "barfije01", "barfije01", "barfije01", "barfije01", "puckeki01", "puckeki01", "puckeki01", "puckeki01", "puckeki01", "puckeki01", "puckeki01", "puckeki01", "puckeki01", "puckeki01",
+#> "puckeki01", "puckeki01", "fernato01", "fernato01", "fernato01", "fernato01", "fernato01", "fernato01", "fernato01", "fernato01", "fernato01", "fernato01", "fernato01", "fernato01", "fernato01", "fernato01", "fernato01", "fernato01", "fernato01", "fernato01", "fernato01", "davisjo02", "davisjo02", "davisjo02", "davisjo02", "davisjo02", "davisjo02", "davisjo02", "davisjo02", "davisjo02", "davisjo02", "davisjo02", "leonade01", "leonade01", "leonade01", "leonade01", "leonade01", "leonade01", "leonade01",
+#> "leonade01", "leonade01", "leonade01", "leonade01", "leonade01", "worreto01", "worreto01", "worreto01", "worreto01", "worreto01", "worreto01", "worreto01", "worreto01", "worreto01", "worreto01", "worreto01", "cansejo01", "cansejo01", "cansejo01", "cansejo01", "cansejo01", "cansejo01", "cansejo01", "cansejo01", "cansejo01", "cansejo01", "cansejo01", "cansejo01", "cansejo01", "cansejo01", "cansejo01", "cansejo01", "cansejo01", "cansejo01", "cansejo01", "davisgl01", "davisgl01", "davisgl01", "davisgl01",
+#> "davisgl01", "davisgl01", "davisgl01", "davisgl01", "davisgl01", "davisgl01", "bernato01", "bernato01", "bernato01", "bernato01", "bernato01", "bernato01", "bernato01", "bernato01", "bernato01", "bernato01", "bernato01", "bernato01", "gedmari01", "gedmari01", "gedmari01", "gedmari01", "gedmari01", "gedmari01", "gedmari01", "gedmari01", "gedmari01", "gedmari01", "gedmari01", "gedmari01", "gedmari01", "gedmari01", "higuete01", "higuete01", "higuete01", "higuete01", "higuete01", "higuete01", "higuete01",
+#> "higuete01", "higuete01", "violafr01", "violafr01", "violafr01", "violafr01", "violafr01", "violafr01", "violafr01", "violafr01", "violafr01", "violafr01", "violafr01", "violafr01", "violafr01", "violafr01", "violafr01", "violafr01", "bedrost01", "bedrost01", "bedrost01", "bedrost01", "bedrost01", "bedrost01", "bedrost01", "bedrost01", "bedrost01", "bedrost01", "bedrost01", "bedrost01", "bedrost01", "bedrost01", "bedrost01", "langsma01", "langsma01", "langsma01", "langsma01", "langsma01", "langsma01",
+#> "langsma01", "langsma01", "langsma01", "langsma01", "langsma01", "langsma01", "langsma01", "langsma01", "langsma01", "langsma01", "langsma01", "pendlte01", "pendlte01", "pendlte01", "pendlte01", "pendlte01", "pendlte01", "pendlte01", "pendlte01", "pendlte01", "pendlte01", "pendlte01", "pendlte01", "pendlte01", "pendlte01", "pendlte01", "pendlte01", "lavalmi01", "lavalmi01", "lavalmi01", "lavalmi01", "lavalmi01", "lavalmi01", "lavalmi01", "lavalmi01", "lavalmi01", "lavalmi01", "lavalmi01", "lavalmi01",
+#> "lavalmi01", "daviser01", "daviser01", "daviser01", "daviser01", "daviser01", "daviser01", "daviser01", "daviser01", "daviser01", "daviser01", "daviser01", "daviser01", "daviser01", "daviser01", "daviser01", "daviser01", "daviser01", "daviser01", "molitpa01", "molitpa01", "molitpa01", "molitpa01", "molitpa01", "molitpa01", "molitpa01", "molitpa01", "molitpa01", "molitpa01", "molitpa01", "molitpa01", "molitpa01", "molitpa01", "molitpa01", "molitpa01", "molitpa01", "molitpa01", "molitpa01", "molitpa01",
+#> "molitpa01", "leonaje01", "leonaje01", "leonaje01", "leonaje01", "leonaje01", "leonaje01", "leonaje01", "leonaje01", "leonaje01", "leonaje01", "leonaje01", "leonaje01", "leonaje01", "leonaje01", "leonaje01", "leonaje01", "mcgwima01", "mcgwima01", "mcgwima01", "mcgwima01", "mcgwima01", "mcgwima01", "mcgwima01", "mcgwima01", "mcgwima01", "mcgwima01", "mcgwima01", "mcgwima01", "mcgwima01", "mcgwima01", "mcgwima01", "mcgwima01", "mcgwima01", "santibe01", "santibe01", "santibe01", "santibe01", "santibe01",
+#> "santibe01", "santibe01", "santibe01", "santibe01", "santibe01", "santibe01", "santibe01", "santibe01", "santibe01", "santibe01", "santibe01", "santibe01", "santibe01", "santibe01", "santibe01", "nokesma01", "nokesma01", "nokesma01", "nokesma01", "nokesma01", "nokesma01", "nokesma01", "nokesma01", "nokesma01", "nokesma01", "nokesma01", "nokesma01", "nokesma01", "samueju01", "samueju01", "samueju01", "samueju01", "samueju01", "samueju01", "samueju01", "samueju01", "samueju01", "samueju01", "samueju01",
+#> "samueju01", "samueju01", "samueju01", "samueju01", "samueju01", "samueju01", "samueju01", "samueju01", "keyji01", "keyji01", "keyji01", "keyji01", "keyji01", "keyji01", "keyji01", "keyji01", "keyji01", "keyji01", "keyji01", "keyji01", "keyji01", "keyji01", "keyji01", "smithza01", "smithza01", "smithza01", "smithza01", "smithza01", "smithza01", "smithza01", "smithza01", "smithza01", "smithza01", "smithza01", "smithza01", "smithza01", "smithza01", "smithza01", "eckerde01", "eckerde01", "eckerde01",
+#> "eckerde01", "eckerde01", "eckerde01", "eckerde01", "eckerde01", "eckerde01", "eckerde01", "eckerde01", "eckerde01", "eckerde01", "eckerde01", "eckerde01", "eckerde01", "eckerde01", "eckerde01", "eckerde01", "eckerde01", "eckerde01", "eckerde01", "eckerde01", "eckerde01", "eckerde01", "steinte01", "steinte01", "steinte01", "steinte01", "steinte01", "steinte01", "steinte01", "steinte01", "steinte01", "steinte01", "steinte01", "steinte01", "steinte01", "steinte01", "hershor01", "hershor01", "hershor01",
+#> "hershor01", "hershor01", "hershor01", "hershor01", "hershor01", "hershor01", "hershor01", "hershor01", "hershor01", "hershor01", "hershor01", "hershor01", "hershor01", "hershor01", "hershor01", "reynoha01", "reynoha01", "reynoha01", "reynoha01", "reynoha01", "reynoha01", "reynoha01", "reynoha01", "reynoha01", "reynoha01", "reynoha01", "reynoha01", "whitede03", "whitede03", "whitede03", "whitede03", "whitede03", "whitede03", "whitede03", "whitede03", "whitede03", "whitede03", "whitede03", "whitede03",
+#> "whitede03", "whitede03", "whitede03", "whitede03", "whitede03", "vanslan01", "vanslan01", "vanslan01", "vanslan01", "vanslan01", "vanslan01", "vanslan01", "vanslan01", "vanslan01", "vanslan01", "vanslan01", "vanslan01", "vanslan01", "vanslan01", "oestero01", "oestero01", "oestero01", "oestero01", "oestero01", "oestero01", "oestero01", "oestero01", "oestero01", "oestero01", "oestero01", "oestero01", "oestero01", "francjo01", "francjo01", "francjo01", "francjo01", "francjo01", "francjo01", "francjo01",
+#> "francjo01", "francjo01", "francjo01", "francjo01", "francjo01", "francjo01", "francjo01", "francjo01", "francjo01", "francjo01", "francjo01", "francjo01", "francjo01", "francjo01", "weisswa01", "weisswa01", "weisswa01", "weisswa01", "weisswa01", "weisswa01", "weisswa01", "weisswa01", "weisswa01", "weisswa01", "weisswa01", "weisswa01", "weisswa01", "weisswa01", "saboch01", "saboch01", "saboch01", "saboch01", "saboch01", "saboch01", "saboch01", "saboch01", "saboch01", "saboch01", "francju01", "francju01",
+#> "francju01", "francju01", "francju01", "francju01", "francju01", "francju01", "francju01", "francju01", "francju01", "francju01", "francju01", "francju01", "francju01", "francju01", "francju01", "francju01", "francju01", "francju01", "francju01", "francju01", "francju01", "francju01", "francju01", "greenmi01", "greenmi01", "greenmi01", "greenmi01", "greenmi01", "greenmi01", "greenmi01", "greenmi01", "greenmi01", "greenmi01", "greenmi01", "greenmi01", "galaran01", "galaran01", "galaran01", "galaran01",
+#> "galaran01", "galaran01", "galaran01", "galaran01", "galaran01", "galaran01", "galaran01", "galaran01", "galaran01", "galaran01", "galaran01", "galaran01", "galaran01", "galaran01", "galaran01", "galaran01", "bonilbo01", "bonilbo01", "bonilbo01", "bonilbo01", "bonilbo01", "bonilbo01", "bonilbo01", "bonilbo01", "bonilbo01", "bonilbo01", "bonilbo01", "bonilbo01", "bonilbo01", "bonilbo01", "bonilbo01", "bonilbo01", "bonilbo01", "bonilbo01", "bonilbo01", "learyti01", "learyti01", "learyti01", "learyti01",
+#> "learyti01", "learyti01", "learyti01", "learyti01", "learyti01", "learyti01", "learyti01", "learyti01", "learyti01", "learyti01", "learyti01", "larkiba01", "larkiba01", "larkiba01", "larkiba01", "larkiba01", "larkiba01", "larkiba01", "larkiba01", "larkiba01", "larkiba01", "larkiba01", "larkiba01", "larkiba01", "larkiba01", "larkiba01", "larkiba01", "larkiba01", "larkiba01", "larkiba01", "whitter01", "whitter01", "whitter01", "whitter01", "whitter01", "whitter01", "whitter01", "whitter01", "whitter01",
+#> "whitter01", "whitter01", "whitter01", "whitter01", "whitter01", "whitter01", "stewada01", "stewada01", "stewada01", "stewada01", "stewada01", "stewada01", "stewada01", "stewada01", "stewada01", "stewada01", "stewada01", "stewada01", "stewada01", "stewada01", "stewada01", "stewada01", "stewada01", "stewada01", "stewada01", "clarkwi02", "clarkwi02", "clarkwi02", "clarkwi02", "clarkwi02", "clarkwi02", "clarkwi02", "clarkwi02", "clarkwi02", "clarkwi02", "clarkwi02", "clarkwi02", "clarkwi02", "clarkwi02",
+#> "clarkwi02", "clarkwi02", "jacksda02", "jacksda02", "jacksda02", "jacksda02", "jacksda02", "jacksda02", "jacksda02", "jacksda02", "jacksda02", "jacksda02", "jacksda02", "jacksda02", "jacksda02", "jacksda02", "jacksda02", "jacksda02", "jacksda02", "mcreyke01", "mcreyke01", "mcreyke01", "mcreyke01", "mcreyke01", "mcreyke01", "mcreyke01", "mcreyke01", "mcreyke01", "mcreyke01", "mcreyke01", "mcreyke01", "jacksbo01", "jacksbo01", "jacksbo01", "jacksbo01", "jacksbo01", "jacksbo01", "jacksbo01", "jacksbo01",
+#> "davisma01", "davisma01", "davisma01", "davisma01", "davisma01", "davisma01", "davisma01", "davisma01", "davisma01", "davisma01", "davisma01", "davisma01", "davisma01", "davisma01", "davisma01", "davisma01", "davisma01", "davisma01", "darliro01", "darliro01", "darliro01", "darliro01", "darliro01", "darliro01", "darliro01", "darliro01", "darliro01", "darliro01", "darliro01", "darliro01", "darliro01", "darliro01", "darliro01", "draveda01", "draveda01", "draveda01", "draveda01", "draveda01", "draveda01",
+#> "draveda01", "draveda01", "draveda01", "mitchke01", "mitchke01", "mitchke01", "mitchke01", "mitchke01", "mitchke01", "mitchke01", "mitchke01", "mitchke01", "mitchke01", "mitchke01", "mitchke01", "mitchke01", "mitchke01", "mitchke01", "russeje01", "russeje01", "russeje01", "russeje01", "russeje01", "russeje01", "russeje01", "russeje01", "russeje01", "russeje01", "russeje01", "russeje01", "russeje01", "russeje01", "russeje01", "russeje01", "olsongr01", "olsongr01", "olsongr01", "olsongr01", "olsongr01",
+#> "olsongr01", "olsongr01", "olsongr01", "olsongr01", "olsongr01", "olsongr01", "olsongr01", "olsongr01", "olsongr01", "olsongr01", "olsongr01", "olsongr01", "waltoje01", "waltoje01", "waltoje01", "waltoje01", "waltoje01", "waltoje01", "waltoje01", "waltoje01", "waltoje01", "waltoje01", "mcgrifr01", "mcgrifr01", "mcgrifr01", "mcgrifr01", "mcgrifr01", "mcgrifr01", "mcgrifr01", "mcgrifr01", "mcgrifr01", "mcgrifr01", "mcgrifr01", "mcgrifr01", "mcgrifr01", "mcgrifr01", "mcgrifr01", "mcgrifr01", "mcgrifr01",
+#> "mcgrifr01", "mcgrifr01", "mcgrifr01", "mcgrifr01", "tettlmi01", "tettlmi01", "tettlmi01", "tettlmi01", "tettlmi01", "tettlmi01", "tettlmi01", "tettlmi01", "tettlmi01", "tettlmi01", "tettlmi01", "tettlmi01", "tettlmi01", "tettlmi01", "sierrru01", "sierrru01", "sierrru01", "sierrru01", "sierrru01", "sierrru01", "sierrru01", "sierrru01", "sierrru01", "sierrru01", "sierrru01", "sierrru01", "sierrru01", "sierrru01", "sierrru01", "sierrru01", "sierrru01", "sierrru01", "sierrru01", "sierrru01", "sierrru01",
+#> "sierrru01", "sierrru01", "sierrru01", "sierrru01", "johnsho01", "johnsho01", "johnsho01", "johnsho01", "johnsho01", "johnsho01", "johnsho01", "johnsho01", "johnsho01", "johnsho01", "johnsho01", "johnsho01", "johnsho01", "johnsho01", "biggicr01", "biggicr01", "biggicr01", "biggicr01", "biggicr01", "biggicr01", "biggicr01", "biggicr01", "biggicr01", "biggicr01", "biggicr01", "biggicr01", "biggicr01", "biggicr01", "biggicr01", "biggicr01", "biggicr01", "biggicr01", "biggicr01", "biggicr01", "finlech01",
+#> "finlech01", "finlech01", "finlech01", "finlech01", "finlech01", "finlech01", "finlech01", "finlech01", "finlech01", "finlech01", "finlech01", "finlech01", "finlech01", "finlech01", "finlech01", "finlech01", "finlech01", "dunstsh01", "dunstsh01", "dunstsh01", "dunstsh01", "dunstsh01", "dunstsh01", "dunstsh01", "dunstsh01", "dunstsh01", "dunstsh01", "dunstsh01", "dunstsh01", "dunstsh01", "dunstsh01", "dunstsh01", "dunstsh01", "dunstsh01", "dunstsh01", "dunstsh01", "dunstsh01", "dunstsh01", "hatchbi01",
+#> "hatchbi01", "hatchbi01", "hatchbi01", "hatchbi01", "hatchbi01", "hatchbi01", "hatchbi01", "hatchbi01", "hatchbi01", "hatchbi01", "hatchbi01", "hatchbi01", "hatchbi01", "hatchbi01", "welchbo01", "welchbo01", "welchbo01", "welchbo01", "welchbo01", "welchbo01", "welchbo01", "welchbo01", "welchbo01", "welchbo01", "welchbo01", "welchbo01", "welchbo01", "welchbo01", "welchbo01", "welchbo01", "welchbo01", "drabedo01", "drabedo01", "drabedo01", "drabedo01", "drabedo01", "drabedo01", "drabedo01", "drabedo01",
+#> "drabedo01", "drabedo01", "drabedo01", "drabedo01", "drabedo01", "grubeke01", "grubeke01", "grubeke01", "grubeke01", "grubeke01", "grubeke01", "grubeke01", "grubeke01", "grubeke01", "grubeke01", "alomasa02", "alomasa02", "alomasa02", "alomasa02", "alomasa02", "alomasa02", "alomasa02", "alomasa02", "alomasa02", "alomasa02", "alomasa02", "alomasa02", "alomasa02", "alomasa02", "alomasa02", "alomasa02", "alomasa02", "alomasa02", "alomasa02", "alomasa02", "alomasa02", "alomasa02", "burksel01", "burksel01",
+#> "burksel01", "burksel01", "burksel01", "burksel01", "burksel01", "burksel01", "burksel01", "burksel01", "burksel01", "burksel01", "burksel01", "burksel01", "burksel01", "burksel01", "burksel01", "burksel01", "burksel01", "griffke02", "griffke02", "griffke02", "griffke02", "griffke02", "griffke02", "griffke02", "griffke02", "griffke02", "griffke02", "griffke02", "griffke02", "griffke02", "griffke02", "griffke02", "griffke02", "griffke02", "griffke02", "griffke02", "griffke02", "griffke02", "griffke02",
+#> "griffke02", "bondsba01", "bondsba01", "bondsba01", "bondsba01", "bondsba01", "bondsba01", "bondsba01", "bondsba01", "bondsba01", "bondsba01", "bondsba01", "bondsba01", "bondsba01", "bondsba01", "bondsba01", "bondsba01", "bondsba01", "bondsba01", "bondsba01", "bondsba01", "bondsba01", "bondsba01", "maddugr01", "maddugr01", "maddugr01", "maddugr01", "maddugr01", "maddugr01", "maddugr01", "maddugr01", "maddugr01", "maddugr01", "maddugr01", "maddugr01", "maddugr01", "maddugr01", "maddugr01", "maddugr01",
+#> "maddugr01", "maddugr01", "maddugr01", "maddugr01", "maddugr01", "maddugr01", "maddugr01", "maddugr01", "maddugr01", "breamsi01", "breamsi01", "breamsi01", "breamsi01", "breamsi01", "breamsi01", "breamsi01", "breamsi01", "breamsi01", "breamsi01", "breamsi01", "breamsi01", "breamsi01", "dibblro01", "dibblro01", "dibblro01", "dibblro01", "dibblro01", "dibblro01", "dibblro01", "dibblro01", "myersra01", "myersra01", "myersra01", "myersra01", "myersra01", "myersra01", "myersra01", "myersra01", "myersra01",
+#> "myersra01", "myersra01", "myersra01", "myersra01", "myersra01", "myersra01", "thigpbo01", "thigpbo01", "thigpbo01", "thigpbo01", "thigpbo01", "thigpbo01", "thigpbo01", "thigpbo01", "thigpbo01", "thigpbo01", "justida01", "justida01", "justida01", "justida01", "justida01", "justida01", "justida01", "justida01", "justida01", "justida01", "justida01", "justida01", "justida01", "justida01", "justida01", "fieldce01", "fieldce01", "fieldce01", "fieldce01", "fieldce01", "fieldce01", "fieldce01", "fieldce01",
+#> "fieldce01", "fieldce01", "fieldce01", "fieldce01", "fieldce01", "fieldce01", "fieldce01", "willima04", "willima04", "willima04", "willima04", "willima04", "willima04", "willima04", "willima04", "willima04", "willima04", "willima04", "willima04", "willima04", "willima04", "willima04", "willima04", "willima04", "sciosmi01", "sciosmi01", "sciosmi01", "sciosmi01", "sciosmi01", "sciosmi01", "sciosmi01", "sciosmi01", "sciosmi01", "sciosmi01", "sciosmi01", "sciosmi01", "sciosmi01", "rijojo01", "rijojo01",
+#> "rijojo01", "rijojo01", "rijojo01", "rijojo01", "rijojo01", "rijojo01", "rijojo01", "rijojo01", "rijojo01", "rijojo01", "rijojo01", "rijojo01", "glavito02", "glavito02", "glavito02", "glavito02", "glavito02", "glavito02", "glavito02", "glavito02", "glavito02", "glavito02", "glavito02", "glavito02", "glavito02", "glavito02", "glavito02", "glavito02", "glavito02", "glavito02", "glavito02", "glavito02", "glavito02", "glavito02", "alomaro01", "alomaro01", "alomaro01", "alomaro01", "alomaro01", "alomaro01",
+#> "alomaro01", "alomaro01", "alomaro01", "alomaro01", "alomaro01", "alomaro01", "alomaro01", "alomaro01", "alomaro01", "alomaro01", "alomaro01", "alomaro01", "alomaro01", "venturo01", "venturo01", "venturo01", "venturo01", "venturo01", "venturo01", "venturo01", "venturo01", "venturo01", "venturo01", "venturo01", "venturo01", "venturo01", "venturo01", "venturo01", "venturo01", "venturo01", "pagnoto01", "pagnoto01", "pagnoto01", "pagnoto01", "pagnoto01", "pagnoto01", "pagnoto01", "pagnoto01", "pagnoto01",
+#> "pagnoto01", "pagnoto01", "pagnoto01", "wegmabi01", "wegmabi01", "wegmabi01", "wegmabi01", "wegmabi01", "wegmabi01", "wegmabi01", "wegmabi01", "wegmabi01", "wegmabi01", "wegmabi01", "hrbekke01", "hrbekke01", "hrbekke01", "hrbekke01", "hrbekke01", "hrbekke01", "hrbekke01", "hrbekke01", "hrbekke01", "hrbekke01", "hrbekke01", "hrbekke01", "hrbekke01", "hrbekke01", "averyst01", "averyst01", "averyst01", "averyst01", "averyst01", "averyst01", "averyst01", "averyst01", "averyst01", "averyst01", "averyst01",
+#> "harvebr01", "harvebr01", "harvebr01", "harvebr01", "harvebr01", "harvebr01", "harvebr01", "harvebr01", "harvebr01", "knoblch01", "knoblch01", "knoblch01", "knoblch01", "knoblch01", "knoblch01", "knoblch01", "knoblch01", "knoblch01", "knoblch01", "knoblch01", "knoblch01", "bagweje01", "bagweje01", "bagweje01", "bagweje01", "bagweje01", "bagweje01", "bagweje01", "bagweje01", "bagweje01", "bagweje01", "bagweje01", "bagweje01", "bagweje01", "bagweje01", "bagweje01", "thomafr04", "thomafr04", "thomafr04",
+#> "thomafr04", "thomafr04", "thomafr04", "thomafr04", "thomafr04", "thomafr04", "thomafr04", "thomafr04", "thomafr04", "thomafr04", "thomafr04", "thomafr04", "thomafr04", "thomafr04", "thomafr04", "thomafr04", "thomafr04", "cartejo01", "cartejo01", "cartejo01", "cartejo01", "cartejo01", "cartejo01", "cartejo01", "cartejo01", "cartejo01", "cartejo01", "cartejo01", "cartejo01", "cartejo01", "cartejo01", "cartejo01", "cartejo01", "cartejo01", "gantro01", "gantro01", "gantro01", "gantro01", "gantro01",
+#> "gantro01", "gantro01", "gantro01", "gantro01", "gantro01", "gantro01", "gantro01", "gantro01", "gantro01", "gantro01", "gantro01", "gantro01", "gantro01", "abbotji01", "abbotji01", "abbotji01", "abbotji01", "abbotji01", "abbotji01", "abbotji01", "abbotji01", "abbotji01", "abbotji01", "abbotji01", "rodriiv01", "rodriiv01", "rodriiv01", "rodriiv01", "rodriiv01", "rodriiv01", "rodriiv01", "rodriiv01", "rodriiv01", "rodriiv01", "rodriiv01", "rodriiv01", "rodriiv01", "rodriiv01", "rodriiv01", "rodriiv01",
+#> "rodriiv01", "rodriiv01", "rodriiv01", "rodriiv01", "rodriiv01", "rodriiv01", "rodriiv01", "gracema01", "gracema01", "gracema01", "gracema01", "gracema01", "gracema01", "gracema01", "gracema01", "gracema01", "gracema01", "gracema01", "gracema01", "gracema01", "gracema01", "gracema01", "gracema01", "lindjo01", "lindjo01", "lindjo01", "lindjo01", "lindjo01", "lindjo01", "lindjo01", "lindjo01", "lindjo01", "lindjo01", "walkela01", "walkela01", "walkela01", "walkela01", "walkela01", "walkela01", "walkela01",
+#> "walkela01", "walkela01", "walkela01", "walkela01", "walkela01", "walkela01", "walkela01", "walkela01", "walkela01", "walkela01", "walkela01", "smoltjo01", "smoltjo01", "smoltjo01", "smoltjo01", "smoltjo01", "smoltjo01", "smoltjo01", "smoltjo01", "smoltjo01", "smoltjo01", "smoltjo01", "smoltjo01", "smoltjo01", "smoltjo01", "smoltjo01", "smoltjo01", "smoltjo01", "smoltjo01", "smoltjo01", "smoltjo01", "smoltjo01", "smoltjo01", "listapa01", "listapa01", "listapa01", "listapa01", "listapa01", "listapa01",
+#> "karroer01", "karroer01", "karroer01", "karroer01", "karroer01", "karroer01", "karroer01", "karroer01", "karroer01", "karroer01", "karroer01", "karroer01", "karroer01", "karroer01", "martied01", "martied01", "martied01", "martied01", "martied01", "martied01", "martied01", "martied01", "martied01", "martied01", "martied01", "martied01", "martied01", "martied01", "martied01", "martied01", "martied01", "martied01", "gonzaju03", "gonzaju03", "gonzaju03", "gonzaju03", "gonzaju03", "gonzaju03", "gonzaju03",
+#> "gonzaju03", "gonzaju03", "gonzaju03", "gonzaju03", "gonzaju03", "gonzaju03", "gonzaju03", "gonzaju03", "gonzaju03", "gonzaju03", "frymatr01", "frymatr01", "frymatr01", "frymatr01", "frymatr01", "frymatr01", "frymatr01", "frymatr01", "frymatr01", "frymatr01", "frymatr01", "frymatr01", "frymatr01", "sheffga01", "sheffga01", "sheffga01", "sheffga01", "sheffga01", "sheffga01", "sheffga01", "sheffga01", "sheffga01", "sheffga01", "sheffga01", "sheffga01", "sheffga01", "sheffga01", "sheffga01", "sheffga01",
+#> "sheffga01", "sheffga01", "sheffga01", "sheffga01", "sheffga01", "sheffga01", "sheffga01", "sheffga01", "daultda01", "daultda01", "daultda01", "daultda01", "daultda01", "daultda01", "daultda01", "daultda01", "daultda01", "daultda01", "daultda01", "daultda01", "daultda01", "daultda01", "daultda01", "flemida01", "flemida01", "flemida01", "flemida01", "flemida01", "flemida01", "devermi01", "devermi01", "devermi01", "devermi01", "devermi01", "devermi01", "devermi01", "devermi01", "devermi01", "devermi01",
+#> "devermi01", "devermi01", "devermi01", "mcdowja01", "mcdowja01", "mcdowja01", "mcdowja01", "mcdowja01", "mcdowja01", "mcdowja01", "mcdowja01", "mcdowja01", "mcdowja01", "mcdowja01", "mcdowja01", "jonesdo01", "jonesdo01", "jonesdo01", "jonesdo01", "jonesdo01", "jonesdo01", "jonesdo01", "jonesdo01", "jonesdo01", "jonesdo01", "jonesdo01", "jonesdo01", "jonesdo01", "jonesdo01", "jonesdo01", "jonesdo01", "jonesdo01", "jonesdo01", "bordepa01", "bordepa01", "bordepa01", "bordepa01", "bordepa01", "bordepa01",
+#> "bordepa01", "bordepa01", "bordepa01", "bordepa01", "bordepa01", "bordepa01", "bordepa01", "bordepa01", "bordepa01", "bordepa01", "bordepa01", "bordepa01", "bordepa01", "bordepa01", "bordepa01", "bordepa01", "loftoke01", "loftoke01", "loftoke01", "loftoke01", "loftoke01", "loftoke01", "loftoke01", "loftoke01", "loftoke01", "loftoke01", "loftoke01", "loftoke01", "loftoke01", "loftoke01", "loftoke01", "loftoke01", "loftoke01", "loftoke01", "loftoke01", "loftoke01", "vizquom01", "vizquom01", "vizquom01",
+#> "vizquom01", "vizquom01", "vizquom01", "vizquom01", "vizquom01", "vizquom01", "vizquom01", "vizquom01", "vizquom01", "vizquom01", "vizquom01", "vizquom01", "vizquom01", "vizquom01", "vizquom01", "vizquom01", "vizquom01", "vizquom01", "vizquom01", "vizquom01", "vizquom01", "thompro01", "thompro01", "thompro01", "thompro01", "thompro01", "thompro01", "thompro01", "thompro01", "thompro01", "thompro01", "thompro01", "manwaki01", "manwaki01", "manwaki01", "manwaki01", "manwaki01", "manwaki01", "manwaki01",
+#> "manwaki01", "manwaki01", "manwaki01", "manwaki01", "manwaki01", "manwaki01", "manwaki01", "grissma02", "grissma02", "grissma02", "grissma02", "grissma02", "grissma02", "grissma02", "grissma02", "grissma02", "grissma02", "grissma02", "grissma02", "grissma02", "grissma02", "grissma02", "grissma02", "grissma02", "bellja01", "bellja01", "bellja01", "bellja01", "bellja01", "bellja01", "bellja01", "bellja01", "bellja01", "bellja01", "bellja01", "bellja01", "bellja01", "bellja01", "bellja01", "bellja01",
+#> "bellja01", "bellja01", "olerujo01", "olerujo01", "olerujo01", "olerujo01", "olerujo01", "olerujo01", "olerujo01", "olerujo01", "olerujo01", "olerujo01", "olerujo01", "olerujo01", "olerujo01", "olerujo01", "olerujo01", "olerujo01", "olerujo01", "olerujo01", "schilcu01", "schilcu01", "schilcu01", "schilcu01", "schilcu01", "schilcu01", "schilcu01", "schilcu01", "schilcu01", "schilcu01", "schilcu01", "schilcu01", "schilcu01", "schilcu01", "schilcu01", "schilcu01", "schilcu01", "schilcu01", "schilcu01",
+#> "schilcu01", "schilcu01", "montgje01", "montgje01", "montgje01", "montgje01", "montgje01", "montgje01", "montgje01", "montgje01", "montgje01", "montgje01", "montgje01", "montgje01", "montgje01", "salmoti01", "salmoti01", "salmoti01", "salmoti01", "salmoti01", "salmoti01", "salmoti01", "salmoti01", "salmoti01", "salmoti01", "salmoti01", "salmoti01", "salmoti01", "salmoti01", "piazzmi01", "piazzmi01", "piazzmi01", "piazzmi01", "piazzmi01", "piazzmi01", "piazzmi01", "piazzmi01", "piazzmi01", "piazzmi01",
+#> "piazzmi01", "piazzmi01", "piazzmi01", "piazzmi01", "piazzmi01", "piazzmi01", "piazzmi01", "piazzmi01", "baergca01", "baergca01", "baergca01", "baergca01", "baergca01", "baergca01", "baergca01", "baergca01", "baergca01", "baergca01", "baergca01", "baergca01", "baergca01", "baergca01", "baergca01", "baergca01", "stanlmi02", "stanlmi02", "stanlmi02", "stanlmi02", "stanlmi02", "stanlmi02", "stanlmi02", "stanlmi02", "stanlmi02", "stanlmi02", "stanlmi02", "stanlmi02", "stanlmi02", "stanlmi02", "stanlmi02",
+#> "stanlmi02", "stanlmi02", "stanlmi02", "belleal01", "belleal01", "belleal01", "belleal01", "belleal01", "belleal01", "belleal01", "belleal01", "belleal01", "belleal01", "belleal01", "belleal01", "dykstle01", "dykstle01", "dykstle01", "dykstle01", "dykstle01", "dykstle01", "dykstle01", "dykstle01", "dykstle01", "dykstle01", "dykstle01", "dykstle01", "dykstle01", "coneda01", "coneda01", "coneda01", "coneda01", "coneda01", "coneda01", "coneda01", "coneda01", "coneda01", "coneda01", "coneda01", "coneda01",
+#> "coneda01", "coneda01", "coneda01", "coneda01", "coneda01", "coneda01", "coneda01", "lewisda01", "lewisda01", "lewisda01", "lewisda01", "lewisda01", "lewisda01", "lewisda01", "lewisda01", "lewisda01", "lewisda01", "lewisda01", "lewisda01", "lewisda01", "lewisda01", "lewisda01", "beckro01", "beckro01", "beckro01", "beckro01", "beckro01", "beckro01", "beckro01", "beckro01", "beckro01", "beckro01", "beckro01", "beckro01", "beckro01", "beckro01", "hamelbo01", "hamelbo01", "hamelbo01", "hamelbo01", "hamelbo01",
+#> "hamelbo01", "mondera01", "mondera01", "mondera01", "mondera01", "mondera01", "mondera01", "mondera01", "mondera01", "mondera01", "mondera01", "mondera01", "mondera01", "mondera01", "mondera01", "mondera01", "mondera01", "aloumo01", "aloumo01", "aloumo01", "aloumo01", "aloumo01", "aloumo01", "aloumo01", "aloumo01", "aloumo01", "aloumo01", "aloumo01", "aloumo01", "aloumo01", "aloumo01", "aloumo01", "aloumo01", "aloumo01", "aloumo01", "portuma01", "portuma01", "portuma01", "portuma01", "portuma01",
+#> "portuma01", "portuma01", "portuma01", "portuma01", "portuma01", "portuma01", "portuma01", "portuma01", "portuma01", "portuma01", "portuma01", "cordewi01", "cordewi01", "cordewi01", "cordewi01", "cordewi01", "cordewi01", "cordewi01", "cordewi01", "cordewi01", "cordewi01", "cordewi01", "cordewi01", "cordewi01", "cordewi01", "cordewi01", "cordewi01", "coninje01", "coninje01", "coninje01", "coninje01", "coninje01", "coninje01", "coninje01", "coninje01", "coninje01", "coninje01", "coninje01", "coninje01",
+#> "coninje01", "coninje01", "coninje01", "coninje01", "coninje01", "coninje01", "coninje01", "coninje01", "johnsra05", "johnsra05", "johnsra05", "johnsra05", "johnsra05", "johnsra05", "johnsra05", "johnsra05", "johnsra05", "johnsra05", "johnsra05", "johnsra05", "johnsra05", "johnsra05", "johnsra05", "johnsra05", "johnsra05", "johnsra05", "johnsra05", "johnsra05", "johnsra05", "johnsra05", "johnsra05", "johnsra05", "snowjt01", "snowjt01", "snowjt01", "snowjt01", "snowjt01", "snowjt01", "snowjt01", "snowjt01",
+#> "snowjt01", "snowjt01", "snowjt01", "snowjt01", "snowjt01", "snowjt01", "snowjt01", "snowjt01", "caminke01", "caminke01", "caminke01", "caminke01", "caminke01", "caminke01", "caminke01", "caminke01", "caminke01", "caminke01", "caminke01", "caminke01", "caminke01", "caminke01", "caminke01", "caminke01", "johnsch04", "johnsch04", "johnsch04", "johnsch04", "johnsch04", "johnsch04", "johnsch04", "johnsch04", "johnsch04", "johnsch04", "johnsch04", "johnsch04", "johnsch04", "johnsch04", "finlest01", "finlest01",
+#> "finlest01", "finlest01", "finlest01", "finlest01", "finlest01", "finlest01", "finlest01", "finlest01", "finlest01", "finlest01", "finlest01", "finlest01", "finlest01", "finlest01", "finlest01", "finlest01", "finlest01", "finlest01", "vaughmo01", "vaughmo01", "vaughmo01", "vaughmo01", "vaughmo01", "vaughmo01", "vaughmo01", "vaughmo01", "vaughmo01", "vaughmo01", "vaughmo01", "vaughmo01", "mesajo01", "mesajo01", "mesajo01", "mesajo01", "mesajo01", "mesajo01", "mesajo01", "mesajo01", "mesajo01", "mesajo01",
+#> "mesajo01", "mesajo01", "mesajo01", "mesajo01", "mesajo01", "mesajo01", "mesajo01", "mesajo01", "mesajo01", "mesajo01", "mesajo01", "mesajo01", "henketo01", "henketo01", "henketo01", "henketo01", "henketo01", "henketo01", "henketo01", "henketo01", "henketo01", "henketo01", "henketo01", "henketo01", "henketo01", "henketo01", "cordoma01", "cordoma01", "cordoma01", "cordoma01", "cordoma01", "cordoma01", "cordoma01", "cordoma01", "cordoma01", "nomohi01", "nomohi01", "nomohi01", "nomohi01", "nomohi01",
+#> "nomohi01", "nomohi01", "nomohi01", "nomohi01", "nomohi01", "nomohi01", "nomohi01", "nomohi01", "ramirma02", "ramirma02", "ramirma02", "ramirma02", "ramirma02", "ramirma02", "ramirma02", "ramirma02", "ramirma02", "ramirma02", "ramirma02", "ramirma02", "ramirma02", "ramirma02", "ramirma02", "ramirma02", "ramirma02", "ramirma02", "ramirma02", "ramirma02", "ramirma02", "valenjo02", "valenjo02", "valenjo02", "valenjo02", "valenjo02", "valenjo02", "valenjo02", "valenjo02", "valenjo02", "valenjo02", "valenjo02",
+#> "castivi02", "castivi02", "castivi02", "castivi02", "castivi02", "castivi02", "castivi02", "castivi02", "castivi02", "castivi02", "castivi02", "castivi02", "castivi02", "castivi02", "castivi02", "castivi02", "castivi02", "castivi02", "bicheda01", "bicheda01", "bicheda01", "bicheda01", "bicheda01", "bicheda01", "bicheda01", "bicheda01", "bicheda01", "bicheda01", "bicheda01", "bicheda01", "bicheda01", "bicheda01", "bicheda01", "sosasa01", "sosasa01", "sosasa01", "sosasa01", "sosasa01", "sosasa01",
+#> "sosasa01", "sosasa01", "sosasa01", "sosasa01", "sosasa01", "sosasa01", "sosasa01", "sosasa01", "sosasa01", "sosasa01", "sosasa01", "sosasa01", "sosasa01", "thomeji01", "thomeji01", "thomeji01", "thomeji01", "thomeji01", "thomeji01", "thomeji01", "thomeji01", "thomeji01", "thomeji01", "thomeji01", "thomeji01", "thomeji01", "thomeji01", "thomeji01", "thomeji01", "thomeji01", "thomeji01", "thomeji01", "thomeji01", "thomeji01", "thomeji01", "thomeji01", "thomeji01", "thomeji01", "edmonji01", "edmonji01",
+#> "edmonji01", "edmonji01", "edmonji01", "edmonji01", "edmonji01", "edmonji01", "edmonji01", "edmonji01", "edmonji01", "edmonji01", "edmonji01", "edmonji01", "edmonji01", "edmonji01", "edmonji01", "edmonji01", "edmonji01", "mussimi01", "mussimi01", "mussimi01", "mussimi01", "mussimi01", "mussimi01", "mussimi01", "mussimi01", "mussimi01", "mussimi01", "mussimi01", "mussimi01", "mussimi01", "mussimi01", "mussimi01", "mussimi01", "mussimi01", "mussimi01", "schoupe01", "schoupe01", "schoupe01", "schoupe01",
+#> "schoupe01", "schoupe01", "schoupe01", "schoupe01", "schoupe01", "schoupe01", "schoupe01", "schoupe01", "sandere02", "sandere02", "sandere02", "sandere02", "sandere02", "sandere02", "sandere02", "sandere02", "sandere02", "sandere02", "sandere02", "sandere02", "sandere02", "sandere02", "sandere02", "sandere02", "sandere02", "willibe02", "willibe02", "willibe02", "willibe02", "willibe02", "willibe02", "willibe02", "willibe02", "willibe02", "willibe02", "willibe02", "willibe02", "willibe02", "willibe02",
+#> "willibe02", "willibe02", "butlebr01", "butlebr01", "butlebr01", "butlebr01", "butlebr01", "butlebr01", "butlebr01", "butlebr01", "butlebr01", "butlebr01", "butlebr01", "butlebr01", "butlebr01", "butlebr01", "butlebr01", "butlebr01", "butlebr01", "butlebr01", "hentgpa01", "hentgpa01", "hentgpa01", "hentgpa01", "hentgpa01", "hentgpa01", "hentgpa01", "hentgpa01", "hentgpa01", "hentgpa01", "hentgpa01", "hentgpa01", "hentgpa01", "hentgpa01", "buhneja01", "buhneja01", "buhneja01", "buhneja01", "buhneja01",
+#> "buhneja01", "buhneja01", "buhneja01", "buhneja01", "buhneja01", "buhneja01", "buhneja01", "buhneja01", "buhneja01", "buhneja01", "buhneja01", "lopezja01", "lopezja01", "lopezja01", "lopezja01", "lopezja01", "lopezja01", "lopezja01", "lopezja01", "lopezja01", "lopezja01", "lopezja01", "lopezja01", "lopezja01", "lopezja01", "lopezja01", "lopezja01", "wettejo01", "wettejo01", "wettejo01", "wettejo01", "wettejo01", "wettejo01", "wettejo01", "wettejo01", "wettejo01", "wettejo01", "wettejo01", "wettejo01",
+#> "brantje01", "brantje01", "brantje01", "brantje01", "brantje01", "brantje01", "brantje01", "brantje01", "brantje01", "brantje01", "brantje01", "brantje01", "brantje01", "brantje01", "jeterde01", "jeterde01", "jeterde01", "jeterde01", "jeterde01", "jeterde01", "jeterde01", "jeterde01", "jeterde01", "jeterde01", "jeterde01", "jeterde01", "jeterde01", "jeterde01", "jeterde01", "jeterde01", "jeterde01", "jeterde01", "jeterde01", "jeterde01", "hollato01", "hollato01", "hollato01", "hollato01", "hollato01",
+#> "hollato01", "hollato01", "hollato01", "hollato01", "hollato01", "hollato01", "hollato01", "hollato01", "hollato01", "hollato01", "hollato01", "rodrial01", "rodrial01", "rodrial01", "rodrial01", "rodrial01", "rodrial01", "rodrial01", "rodrial01", "rodrial01", "rodrial01", "rodrial01", "rodrial01", "rodrial01", "rodrial01", "rodrial01", "rodrial01", "rodrial01", "rodrial01", "rodrial01", "rodrial01", "rodrial01", "younger01", "younger01", "younger01", "younger01", "younger01", "younger01", "younger01",
+#> "younger01", "younger01", "younger01", "younger01", "younger01", "younger01", "younger01", "younger01", "younger01", "younger01", "younger01", "pettian01", "pettian01", "pettian01", "pettian01", "pettian01", "pettian01", "pettian01", "pettian01", "pettian01", "pettian01", "pettian01", "pettian01", "pettian01", "pettian01", "pettian01", "pettian01", "pettian01", "pettian01", "leiteal01", "leiteal01", "leiteal01", "leiteal01", "leiteal01", "leiteal01", "leiteal01", "leiteal01", "leiteal01", "leiteal01",
+#> "leiteal01", "leiteal01", "leiteal01", "leiteal01", "leiteal01", "leiteal01", "leiteal01", "leiteal01", "leiteal01", "leiteal01", "leiteal01", "hoffmtr01", "hoffmtr01", "hoffmtr01", "hoffmtr01", "hoffmtr01", "hoffmtr01", "hoffmtr01", "hoffmtr01", "hoffmtr01", "hoffmtr01", "hoffmtr01", "hoffmtr01", "hoffmtr01", "hoffmtr01", "hoffmtr01", "hoffmtr01", "hoffmtr01", "hoffmtr01", "hoffmtr01", "martipe02", "martipe02", "martipe02", "martipe02", "martipe02", "martipe02", "martipe02", "martipe02", "martipe02",
+#> "martipe02", "martipe02", "martipe02", "martipe02", "martipe02", "martipe02", "martipe02", "martipe02", "martipe02", "palmera01", "palmera01", "palmera01", "palmera01", "palmera01", "palmera01", "palmera01", "palmera01", "palmera01", "palmera01", "palmera01", "palmera01", "palmera01", "palmera01", "palmera01", "palmera01", "palmera01", "palmera01", "palmera01", "palmera01", "ordonre01", "ordonre01", "ordonre01", "ordonre01", "ordonre01", "ordonre01", "ordonre01", "ordonre01", "ordonre01", "hernali01",
+#> "hernali01", "hernali01", "hernali01", "hernali01", "hernali01", "hernali01", "hernali01", "hernali01", "hernali01", "hernali01", "hernali01", "hernali01", "hernali01", "hernali01", "hernali01", "hernali01", "hernali01", "hernali01", "hernali01", "hernali01", "hernali01", "shawje01", "shawje01", "shawje01", "shawje01", "shawje01", "shawje01", "shawje01", "shawje01", "shawje01", "shawje01", "shawje01", "shawje01", "shawje01", "shawje01", "garcino01", "garcino01", "garcino01", "garcino01", "garcino01",
+#> "garcino01", "garcino01", "garcino01", "garcino01", "garcino01", "garcino01", "garcino01", "garcino01", "garcino01", "garcino01", "rolensc01", "rolensc01", "rolensc01", "rolensc01", "rolensc01", "rolensc01", "rolensc01", "rolensc01", "rolensc01", "rolensc01", "rolensc01", "rolensc01", "rolensc01", "rolensc01", "rolensc01", "rolensc01", "rolensc01", "rolensc01", "rolensc01", "martiti02", "martiti02", "martiti02", "martiti02", "martiti02", "martiti02", "martiti02", "martiti02", "martiti02", "martiti02",
+#> "martiti02", "martiti02", "martiti02", "martiti02", "martiti02", "martiti02", "blausje01", "blausje01", "blausje01", "blausje01", "blausje01", "blausje01", "blausje01", "blausje01", "blausje01", "blausje01", "blausje01", "blausje01", "blausje01", "neaglde01", "neaglde01", "neaglde01", "neaglde01", "neaglde01", "neaglde01", "neaglde01", "neaglde01", "neaglde01", "neaglde01", "neaglde01", "neaglde01", "neaglde01", "neaglde01", "neaglde01", "riverma01", "riverma01", "riverma01", "riverma01", "riverma01",
+#> "riverma01", "riverma01", "riverma01", "riverma01", "riverma01", "riverma01", "riverma01", "riverma01", "riverma01", "riverma01", "riverma01", "riverma01", "riverma01", "riverma01", "wellsda01", "wellsda01", "wellsda01", "wellsda01", "wellsda01", "wellsda01", "wellsda01", "wellsda01", "wellsda01", "wellsda01", "wellsda01", "wellsda01", "wellsda01", "wellsda01", "wellsda01", "wellsda01", "wellsda01", "wellsda01", "wellsda01", "wellsda01", "wellsda01", "wellsda01", "wellsda01", "wellsda01", "brosisc01",
+#> "brosisc01", "brosisc01", "brosisc01", "brosisc01", "brosisc01", "brosisc01", "brosisc01", "brosisc01", "brosisc01", "brosisc01", "boonebr01", "boonebr01", "boonebr01", "boonebr01", "boonebr01", "boonebr01", "boonebr01", "boonebr01", "boonebr01", "boonebr01", "boonebr01", "boonebr01", "boonebr01", "boonebr01", "boonebr01", "jonesan01", "jonesan01", "jonesan01", "jonesan01", "jonesan01", "jonesan01", "jonesan01", "jonesan01", "jonesan01", "jonesan01", "jonesan01", "jonesan01", "jonesan01", "jonesan01",
+#> "jonesan01", "jonesan01", "jonesan01", "hitchst01", "hitchst01", "hitchst01", "hitchst01", "hitchst01", "hitchst01", "hitchst01", "hitchst01", "hitchst01", "hitchst01", "hitchst01", "hitchst01", "hitchst01", "hitchst01", "hitchst01", "gordoto01", "gordoto01", "gordoto01", "gordoto01", "gordoto01", "gordoto01", "gordoto01", "gordoto01", "gordoto01", "gordoto01", "gordoto01", "gordoto01", "gordoto01", "gordoto01", "gordoto01", "gordoto01", "gordoto01", "gordoto01", "gordoto01", "gordoto01", "gordoto01",
+#> "gordoto01", "grievbe01", "grievbe01", "grievbe01", "grievbe01", "grievbe01", "grievbe01", "grievbe01", "grievbe01", "grievbe01", "grievbe01", "woodke02", "woodke02", "woodke02", "woodke02", "woodke02", "woodke02", "woodke02", "woodke02", "woodke02", "woodke02", "woodke02", "woodke02", "woodke02", "woodke02", "woodke02", "easleda01", "easleda01", "easleda01", "easleda01", "easleda01", "easleda01", "easleda01", "easleda01", "easleda01", "easleda01", "easleda01", "easleda01", "easleda01", "easleda01",
+#> "easleda01", "easleda01", "easleda01", "easleda01", "palmede01", "palmede01", "palmede01", "palmede01", "palmede01", "palmede01", "palmede01", "palmede01", "palmede01", "palmede01", "palmede01", "palmede01", "palmede01", "palmede01", "palmede01", "vaughgr01", "vaughgr01", "vaughgr01", "vaughgr01", "vaughgr01", "vaughgr01", "vaughgr01", "vaughgr01", "vaughgr01", "vaughgr01", "vaughgr01", "vaughgr01", "vaughgr01", "vaughgr01", "vaughgr01", "vaughgr01", "brownke01", "brownke01", "brownke01", "brownke01",
+#> "brownke01", "brownke01", "brownke01", "brownke01", "brownke01", "brownke01", "brownke01", "brownke01", "brownke01", "brownke01", "brownke01", "brownke01", "brownke01", "brownke01", "brownke01", "hernaor01", "hernaor01", "hernaor01", "hernaor01", "hernaor01", "hernaor01", "hernaor01", "hernaor01", "hernaor01", "hernaor01", "greensh01", "greensh01", "greensh01", "greensh01", "greensh01", "greensh01", "greensh01", "greensh01", "greensh01", "greensh01", "greensh01", "greensh01", "greensh01", "greensh01",
+#> "greensh01", "greensh01", "reesepo01", "reesepo01", "reesepo01", "reesepo01", "reesepo01", "reesepo01", "reesepo01", "reesepo01", "liebemi01", "liebemi01", "liebemi01", "liebemi01", "liebemi01", "liebemi01", "liebemi01", "liebemi01", "liebemi01", "liebemi01", "liebemi01", "liebemi01", "liebemi01", "liebemi01", "caseyse01", "caseyse01", "caseyse01", "caseyse01", "caseyse01", "caseyse01", "caseyse01", "caseyse01", "caseyse01", "caseyse01", "caseyse01", "caseyse01", "caseyse01", "jonesch06", "jonesch06",
+#> "jonesch06", "jonesch06", "jonesch06", "jonesch06", "jonesch06", "jonesch06", "jonesch06", "jonesch06", "jonesch06", "jonesch06", "jonesch06", "jonesch06", "jonesch06", "jonesch06", "jonesch06", "jonesch06", "jonesch06", "perezed02", "perezed02", "perezed02", "perezed02", "perezed02", "perezed02", "perezed02", "perezed02", "perezed02", "perezed02", "perezed02", "wagnebi02", "wagnebi02", "wagnebi02", "wagnebi02", "wagnebi02", "wagnebi02", "wagnebi02", "wagnebi02", "wagnebi02", "wagnebi02", "wagnebi02",
+#> "wagnebi02", "wagnebi02", "wagnebi02", "wagnebi02", "wagnebi02", "wagnebi02", "beltrca01", "beltrca01", "beltrca01", "beltrca01", "beltrca01", "beltrca01", "beltrca01", "beltrca01", "beltrca01", "beltrca01", "beltrca01", "beltrca01", "beltrca01", "beltrca01", "beltrca01", "beltrca01", "beltrca01", "beltrca01", "beltrca01", "beltrca01", "willisc01", "willisc01", "willisc01", "willisc01", "willisc01", "willisc01", "willisc01", "willisc01", "willisc01", "willisc01", "willisc01", "delgaca01", "delgaca01",
+#> "delgaca01", "delgaca01", "delgaca01", "delgaca01", "delgaca01", "delgaca01", "delgaca01", "delgaca01", "delgaca01", "delgaca01", "delgaca01", "delgaca01", "delgaca01", "delgaca01", "delgaca01", "alfoned01", "alfoned01", "alfoned01", "alfoned01", "alfoned01", "alfoned01", "alfoned01", "alfoned01", "alfoned01", "alfoned01", "alfoned01", "alfoned01", "alfoned01", "guerrvl01", "guerrvl01", "guerrvl01", "guerrvl01", "guerrvl01", "guerrvl01", "guerrvl01", "guerrvl01", "guerrvl01", "guerrvl01", "guerrvl01",
+#> "guerrvl01", "guerrvl01", "guerrvl01", "guerrvl01", "guerrvl01", "hamptmi01", "hamptmi01", "hamptmi01", "hamptmi01", "hamptmi01", "hamptmi01", "hamptmi01", "hamptmi01", "hamptmi01", "hamptmi01", "hamptmi01", "hamptmi01", "hamptmi01", "hamptmi01", "hamptmi01", "hamptmi01", "moyerja01", "moyerja01", "moyerja01", "moyerja01", "moyerja01", "moyerja01", "moyerja01", "moyerja01", "moyerja01", "moyerja01", "moyerja01", "moyerja01", "moyerja01", "moyerja01", "moyerja01", "moyerja01", "moyerja01", "moyerja01",
+#> "moyerja01", "moyerja01", "moyerja01", "moyerja01", "moyerja01", "moyerja01", "moyerja01", "moyerja01", "moyerja01", "limajo01", "limajo01", "limajo01", "limajo01", "limajo01", "limajo01", "limajo01", "limajo01", "limajo01", "limajo01", "limajo01", "limajo01", "limajo01", "limajo01", "urbinug01", "urbinug01", "urbinug01", "urbinug01", "urbinug01", "urbinug01", "urbinug01", "urbinug01", "urbinug01", "urbinug01", "urbinug01", "urbinug01", "urbinug01", "urbinug01", "stottto01", "stottto01", "stottto01",
+#> "stottto01", "stottto01", "stottto01", "stottto01", "stottto01", "stottto01", "stottto01", "stottto01", "stottto01", "stottto01", "stottto01", "stottto01", "dyeje01", "dyeje01", "dyeje01", "dyeje01", "dyeje01", "dyeje01", "dyeje01", "dyeje01", "dyeje01", "dyeje01", "dyeje01", "dyeje01", "dyeje01", "dyeje01", "dyeje01", "erstada01", "erstada01", "erstada01", "erstada01", "erstada01", "erstada01", "erstada01", "erstada01", "erstada01", "erstada01", "erstada01", "erstada01", "erstada01", "erstada01",
+#> "rogerke01", "rogerke01", "rogerke01", "rogerke01", "rogerke01", "rogerke01", "rogerke01", "rogerke01", "rogerke01", "rogerke01", "rogerke01", "rogerke01", "rogerke01", "rogerke01", "rogerke01", "rogerke01", "rogerke01", "rogerke01", "rogerke01", "rogerke01", "rogerke01", "mathemi01", "mathemi01", "mathemi01", "mathemi01", "mathemi01", "mathemi01", "mathemi01", "mathemi01", "mathemi01", "mathemi01", "mathemi01", "mathemi01", "mathemi01", "perezne01", "perezne01", "perezne01", "perezne01", "perezne01",
+#> "perezne01", "perezne01", "perezne01", "perezne01", "perezne01", "perezne01", "perezne01", "perezne01", "perezne01", "perezne01", "heltoto01", "heltoto01", "heltoto01", "heltoto01", "heltoto01", "heltoto01", "heltoto01", "heltoto01", "heltoto01", "heltoto01", "heltoto01", "heltoto01", "heltoto01", "heltoto01", "heltoto01", "heltoto01", "heltoto01", "giambja01", "giambja01", "giambja01", "giambja01", "giambja01", "giambja01", "giambja01", "giambja01", "giambja01", "giambja01", "giambja01", "giambja01",
+#> "giambja01", "giambja01", "giambja01", "giambja01", "giambja01", "giambja01", "giambja01", "giambja01", "giambja01", "kentje01", "kentje01", "kentje01", "kentje01", "kentje01", "kentje01", "kentje01", "kentje01", "kentje01", "kentje01", "kentje01", "kentje01", "kentje01", "kentje01", "kentje01", "kentje01", "kentje01", "kentje01", "kentje01", "jonesto02", "jonesto02", "jonesto02", "jonesto02", "jonesto02", "jonesto02", "jonesto02", "jonesto02", "jonesto02", "jonesto02", "jonesto02", "jonesto02",
+#> "jonesto02", "jonesto02", "jonesto02", "jonesto02", "jonesto02", "jonesto02", "jonesto02", "alfonan01", "alfonan01", "alfonan01", "alfonan01", "alfonan01", "alfonan01", "alfonan01", "alfonan01", "alfonan01", "alfonan01", "alfonan01", "sasakka01", "sasakka01", "sasakka01", "sasakka01", "furcara01", "furcara01", "furcara01", "furcara01", "furcara01", "furcara01", "furcara01", "furcara01", "furcara01", "furcara01", "furcara01", "furcara01", "furcara01", "furcara01", "furcara01", "glaustr01", "glaustr01",
+#> "glaustr01", "glaustr01", "glaustr01", "glaustr01", "glaustr01", "glaustr01", "glaustr01", "glaustr01", "glaustr01", "glaustr01", "glaustr01", "posadjo01", "posadjo01", "posadjo01", "posadjo01", "posadjo01", "posadjo01", "posadjo01", "posadjo01", "posadjo01", "posadjo01", "posadjo01", "posadjo01", "posadjo01", "posadjo01", "posadjo01", "posadjo01", "posadjo01", "ordonma01", "ordonma01", "ordonma01", "ordonma01", "ordonma01", "ordonma01", "ordonma01", "ordonma01", "ordonma01", "ordonma01", "ordonma01",
+#> "ordonma01", "ordonma01", "ordonma01", "ordonma01", "renteed01", "renteed01", "renteed01", "renteed01", "renteed01", "renteed01", "renteed01", "renteed01", "renteed01", "renteed01", "renteed01", "renteed01", "renteed01", "renteed01", "renteed01", "renteed01", "mientdo01", "mientdo01", "mientdo01", "mientdo01", "mientdo01", "mientdo01", "mientdo01", "mientdo01", "mientdo01", "mientdo01", "mientdo01", "mientdo01", "mientdo01", "chaveer01", "chaveer01", "chaveer01", "chaveer01", "chaveer01", "chaveer01",
+#> "chaveer01", "chaveer01", "chaveer01", "chaveer01", "chaveer01", "chaveer01", "chaveer01", "chaveer01", "chaveer01", "chaveer01", "chaveer01", "camermi01", "camermi01", "camermi01", "camermi01", "camermi01", "camermi01", "camermi01", "camermi01", "camermi01", "camermi01", "camermi01", "camermi01", "camermi01", "camermi01", "camermi01", "camermi01", "camermi01", "camermi01", "hunteto01", "hunteto01", "hunteto01", "hunteto01", "hunteto01", "hunteto01", "hunteto01", "hunteto01", "hunteto01", "hunteto01",
+#> "hunteto01", "hunteto01", "hunteto01", "hunteto01", "hunteto01", "hunteto01", "hunteto01", "hunteto01", "hunteto01", "suzukic01", "suzukic01", "suzukic01", "suzukic01", "suzukic01", "suzukic01", "suzukic01", "suzukic01", "suzukic01", "suzukic01", "suzukic01", "suzukic01", "suzukic01", "suzukic01", "suzukic01", "suzukic01", "vinafe01", "vinafe01", "vinafe01", "vinafe01", "vinafe01", "vinafe01", "vinafe01", "vinafe01", "vinafe01", "vinafe01", "vinafe01", "vinafe01", "ausmubr01", "ausmubr01", "ausmubr01",
+#> "ausmubr01", "ausmubr01", "ausmubr01", "ausmubr01", "ausmubr01", "ausmubr01", "ausmubr01", "ausmubr01", "ausmubr01", "ausmubr01", "ausmubr01", "ausmubr01", "ausmubr01", "ausmubr01", "ausmubr01", "ausmubr01", "cabreor01", "cabreor01", "cabreor01", "cabreor01", "cabreor01", "cabreor01", "cabreor01", "cabreor01", "cabreor01", "cabreor01", "cabreor01", "cabreor01", "cabreor01", "cabreor01", "cabreor01", "cabreor01", "cabreor01", "cabreor01", "counscr01", "counscr01", "counscr01", "counscr01", "counscr01",
+#> "counscr01", "counscr01", "counscr01", "counscr01", "counscr01", "counscr01", "counscr01", "counscr01", "counscr01", "counscr01", "counscr01", "counscr01", "counscr01", "benitar01", "benitar01", "benitar01", "benitar01", "benitar01", "benitar01", "benitar01", "benitar01", "benitar01", "benitar01", "benitar01", "benitar01", "benitar01", "benitar01", "benitar01", "benitar01", "benitar01", "benitar01", "pujolal01", "pujolal01", "pujolal01", "pujolal01", "pujolal01", "pujolal01", "pujolal01", "pujolal01",
+#> "pujolal01", "pujolal01", "pujolal01", "pujolal01", "pujolal01", "pujolal01", "pujolal01", "gonzalu01", "gonzalu01", "gonzalu01", "gonzalu01", "gonzalu01", "gonzalu01", "gonzalu01", "gonzalu01", "gonzalu01", "gonzalu01", "gonzalu01", "gonzalu01", "gonzalu01", "gonzalu01", "gonzalu01", "gonzalu01", "gonzalu01", "gonzalu01", "gonzalu01", "gonzalu01", "aurilri01", "aurilri01", "aurilri01", "aurilri01", "aurilri01", "aurilri01", "aurilri01", "aurilri01", "aurilri01", "aurilri01", "aurilri01", "aurilri01",
+#> "aurilri01", "aurilri01", "aurilri01", "aurilri01", "muldema01", "muldema01", "muldema01", "muldema01", "muldema01", "muldema01", "muldema01", "muldema01", "muldema01", "nenro01", "nenro01", "nenro01", "nenro01", "nenro01", "nenro01", "nenro01", "nenro01", "nenro01", "nenro01", "nenro01", "kennead01", "kennead01", "kennead01", "kennead01", "kennead01", "kennead01", "kennead01", "kennead01", "kennead01", "kennead01", "kennead01", "kennead01", "kennead01", "kennead01", "valenbo02", "valenbo02", "valenbo02",
+#> "valenbo02", "valenbo02", "valenbo02", "valenbo02", "valenbo02", "valenbo02", "valenbo02", "valenbo02", "valenbo02", "zitoba01", "zitoba01", "zitoba01", "zitoba01", "zitoba01", "zitoba01", "zitoba01", "zitoba01", "zitoba01", "zitoba01", "zitoba01", "zitoba01", "zitoba01", "zitoba01", "zitoba01", "molinbe01", "molinbe01", "molinbe01", "molinbe01", "molinbe01", "molinbe01", "molinbe01", "molinbe01", "molinbe01", "molinbe01", "molinbe01", "molinbe01", "molinbe01", "molinbe01", "graveda01", "graveda01",
+#> "graveda01", "graveda01", "graveda01", "graveda01", "graveda01", "graveda01", "graveda01", "graveda01", "graveda01", "graveda01", "graveda01", "tejadmi01", "tejadmi01", "tejadmi01", "tejadmi01", "tejadmi01", "tejadmi01", "tejadmi01", "tejadmi01", "tejadmi01", "tejadmi01", "tejadmi01", "tejadmi01", "tejadmi01", "tejadmi01", "tejadmi01", "tejadmi01", "tejadmi01", "kochbi01", "kochbi01", "kochbi01", "kochbi01", "kochbi01", "kochbi01", "kochbi01", "hinsker01", "hinsker01", "hinsker01", "hinsker01", "hinsker01",
+#> "hinsker01", "hinsker01", "hinsker01", "hinsker01", "hinsker01", "hinsker01", "hinsker01", "hinsker01", "hinsker01", "jennija01", "jennija01", "jennija01", "jennija01", "jennija01", "jennija01", "jennija01", "jennija01", "jennija01", "soriaal01", "soriaal01", "soriaal01", "soriaal01", "soriaal01", "soriaal01", "soriaal01", "soriaal01", "soriaal01", "soriaal01", "soriaal01", "soriaal01", "soriaal01", "soriaal01", "soriaal01", "soriaal01", "soriaal01", "anderga01", "anderga01", "anderga01", "anderga01",
+#> "anderga01", "anderga01", "anderga01", "anderga01", "anderga01", "anderga01", "anderga01", "anderga01", "anderga01", "anderga01", "anderga01", "anderga01", "anderga01", "lowede01", "lowede01", "lowede01", "lowede01", "lowede01", "lowede01", "lowede01", "lowede01", "lowede01", "lowede01", "lowede01", "lowede01", "lowede01", "lowede01", "lowede01", "lowede01", "lowede01", "lowede01", "lowede01", "beckejo02", "beckejo02", "beckejo02", "beckejo02", "beckejo02", "beckejo02", "beckejo02", "beckejo02",
+#> "beckejo02", "beckejo02", "beckejo02", "beckejo02", "beckejo02", "beckejo02", "beckejo02", "hallaro01", "hallaro01", "hallaro01", "hallaro01", "hallaro01", "hallaro01", "hallaro01", "hallaro01", "hallaro01", "hallaro01", "hallaro01", "hallaro01", "hallaro01", "hallaro01", "hallaro01", "hallaro01", "gagneer01", "gagneer01", "gagneer01", "gagneer01", "gagneer01", "gagneer01", "gagneer01", "gagneer01", "gagneer01", "gagneer01", "gagneer01", "leede02", "leede02", "leede02", "leede02", "leede02", "leede02",
+#> "leede02", "leede02", "leede02", "leede02", "leede02", "leede02", "leede02", "leede02", "leede02", "leede02", "leede02", "castilu01", "castilu01", "castilu01", "castilu01", "castilu01", "castilu01", "castilu01", "castilu01", "castilu01", "castilu01", "castilu01", "castilu01", "castilu01", "castilu01", "castilu01", "castilu01", "cruzjo02", "cruzjo02", "cruzjo02", "cruzjo02", "cruzjo02", "cruzjo02", "cruzjo02", "cruzjo02", "cruzjo02", "cruzjo02", "cruzjo02", "cruzjo02", "cruzjo02", "cruzjo02", "cruzjo02",
+#> "foulkke01", "foulkke01", "foulkke01", "foulkke01", "foulkke01", "foulkke01", "foulkke01", "foulkke01", "foulkke01", "foulkke01", "foulkke01", "foulkke01", "berroan01", "berroan01", "berroan01", "berroan01", "berroan01", "berroan01", "berroan01", "berroan01", "berroan01", "berroan01", "willido03", "willido03", "willido03", "willido03", "willido03", "willido03", "willido03", "willido03", "willido03", "willido03", "muellbi02", "muellbi02", "muellbi02", "muellbi02", "muellbi02", "muellbi02", "muellbi02",
+#> "muellbi02", "muellbi02", "muellbi02", "muellbi02", "muellbi02", "wellsve01", "wellsve01", "wellsve01", "wellsve01", "wellsve01", "wellsve01", "wellsve01", "wellsve01", "wellsve01", "wellsve01", "wellsve01", "wellsve01", "wellsve01", "wellsve01", "wellsve01", "vidrojo01", "vidrojo01", "vidrojo01", "vidrojo01", "vidrojo01", "vidrojo01", "vidrojo01", "vidrojo01", "vidrojo01", "vidrojo01", "vidrojo01", "vidrojo01", "lowelmi01", "lowelmi01", "lowelmi01", "lowelmi01", "lowelmi01", "lowelmi01", "lowelmi01",
+#> "lowelmi01", "lowelmi01", "lowelmi01", "lowelmi01", "lowelmi01", "lowelmi01", "gilesma01", "gilesma01", "gilesma01", "gilesma01", "gilesma01", "gilesma01", "gilesma01", "wolfra02", "wolfra02", "wolfra02", "wolfra02", "wolfra02", "wolfra02", "wolfra02", "wolfra02", "wolfra02", "wolfra02", "wolfra02", "wolfra02", "wolfra02", "wolfra02", "wolfra02", "wolfra02", "wolfra02", "wolfra02", "ortizda01", "ortizda01", "ortizda01", "ortizda01", "ortizda01", "ortizda01", "ortizda01", "ortizda01", "ortizda01",
+#> "ortizda01", "ortizda01", "ortizda01", "ortizda01", "ortizda01", "ortizda01", "ortizda01", "ortizda01", "ortizda01", "ortizda01", "santajo01", "santajo01", "santajo01", "santajo01", "santajo01", "santajo01", "santajo01", "santajo01", "santajo01", "santajo01", "santajo01", "santajo01", "izturce01", "izturce01", "izturce01", "izturce01", "izturce01", "izturce01", "izturce01", "izturce01", "izturce01", "izturce01", "izturce01", "izturce01", "izturce01", "izturce01", "izturce01", "izturce01", "crosbbo01",
+#> "crosbbo01", "crosbbo01", "crosbbo01", "crosbbo01", "crosbbo01", "crosbbo01", "crosbbo01", "crosbbo01", "bayja01", "bayja01", "bayja01", "bayja01", "bayja01", "bayja01", "bayja01", "bayja01", "bayja01", "bayja01", "bayja01", "bayja01", "bayja01", "teixema01", "teixema01", "teixema01", "teixema01", "teixema01", "teixema01", "teixema01", "teixema01", "teixema01", "teixema01", "teixema01", "teixema01", "teixema01", "teixema01", "teixema01", "morame01", "morame01", "morame01", "morame01", "morame01",
+#> "morame01", "morame01", "morame01", "morame01", "morame01", "morame01", "morame01", "morame01", "morame01", "martivi01", "martivi01", "martivi01", "martivi01", "martivi01", "martivi01", "martivi01", "martivi01", "martivi01", "martivi01", "martivi01", "martivi01", "martivi01", "martivi01", "loretma01", "loretma01", "loretma01", "loretma01", "loretma01", "loretma01", "loretma01", "loretma01", "loretma01", "loretma01", "loretma01", "loretma01", "loretma01", "loretma01", "loretma01", "loretma01", "beltrad01",
+#> "beltrad01", "beltrad01", "beltrad01", "beltrad01", "beltrad01", "beltrad01", "beltrad01", "beltrad01", "beltrad01", "beltrad01", "beltrad01", "beltrad01", "beltrad01", "beltrad01", "beltrad01", "beltrad01", "beltrad01", "estrajo01", "estrajo01", "estrajo01", "estrajo01", "estrajo01", "estrajo01", "estrajo01", "estrajo01", "abreubo01", "abreubo01", "abreubo01", "abreubo01", "abreubo01", "abreubo01", "abreubo01", "abreubo01", "abreubo01", "abreubo01", "abreubo01", "abreubo01", "abreubo01", "abreubo01",
+#> "abreubo01", "abreubo01", "abreubo01", "abreubo01", "abreubo01", "abreubo01", "wilsoja02", "wilsoja02", "wilsoja02", "wilsoja02", "wilsoja02", "wilsoja02", "wilsoja02", "wilsoja02", "wilsoja02", "wilsoja02", "wilsoja02", "wilsoja02", "wilsoja02", "wilsoja02", "konerpa01", "konerpa01", "konerpa01", "konerpa01", "konerpa01", "konerpa01", "konerpa01", "konerpa01", "konerpa01", "konerpa01", "konerpa01", "konerpa01", "konerpa01", "konerpa01", "konerpa01", "konerpa01", "konerpa01", "konerpa01", "konerpa01",
+#> "drewjd01", "drewjd01", "drewjd01", "drewjd01", "drewjd01", "drewjd01", "drewjd01", "drewjd01", "drewjd01", "drewjd01", "drewjd01", "drewjd01", "drewjd01", "drewjd01", "schmija01", "schmija01", "schmija01", "schmija01", "schmija01", "schmija01", "schmija01", "schmija01", "schmija01", "schmija01", "schmija01", "schmija01", "schmija01", "schmija01", "schmija01", "schmija01", "nathajo01", "nathajo01", "nathajo01", "nathajo01", "nathajo01", "nathajo01", "nathajo01", "nathajo01", "nathajo01", "nathajo01",
+#> "nathajo01", "nathajo01", "nathajo01", "nathajo01", "nathajo01", "colonba01", "colonba01", "colonba01", "colonba01", "colonba01", "colonba01", "colonba01", "colonba01", "colonba01", "colonba01", "colonba01", "colonba01", "colonba01", "colonba01", "colonba01", "colonba01", "colonba01", "colonba01", "colonba01", "carpech01", "carpech01", "carpech01", "carpech01", "carpech01", "carpech01", "carpech01", "carpech01", "carpech01", "carpech01", "carpech01", "carpech01", "carpech01", "carpech01", "carpech01",
+#> "hudsoor01", "hudsoor01", "hudsoor01", "hudsoor01", "hudsoor01", "hudsoor01", "hudsoor01", "hudsoor01", "hudsoor01", "hudsoor01", "hudsoor01", "hudsoor01", "varitja01", "varitja01", "varitja01", "varitja01", "varitja01", "varitja01", "varitja01", "varitja01", "varitja01", "varitja01", "varitja01", "varitja01", "varitja01", "varitja01", "varitja01", "oswalro01", "oswalro01", "oswalro01", "oswalro01", "oswalro01", "oswalro01", "oswalro01", "oswalro01", "oswalro01", "oswalro01", "oswalro01", "oswalro01",
+#> "oswalro01", "oswalro01", "cordech01", "cordech01", "cordech01", "cordech01", "cordech01", "cordech01", "cordech01", "streehu01", "streehu01", "streehu01", "streehu01", "streehu01", "streehu01", "streehu01", "streehu01", "streehu01", "streehu01", "streehu01", "streehu01", "howarry01", "howarry01", "howarry01", "howarry01", "howarry01", "howarry01", "howarry01", "howarry01", "howarry01", "howarry01", "howarry01", "howarry01", "ensbemo01", "ensbemo01", "ensbemo01", "ensbemo01", "ensbemo01", "ensbemo01",
+#> "ensbemo01", "ensbemo01", "ensbemo01", "barremi01", "barremi01", "barremi01", "barremi01", "barremi01", "barremi01", "barremi01", "barremi01", "barremi01", "barremi01", "barremi01", "barremi01", "barremi01", "cabremi01", "cabremi01", "cabremi01", "cabremi01", "cabremi01", "cabremi01", "cabremi01", "cabremi01", "cabremi01", "cabremi01", "cabremi01", "cabremi01", "cabremi01", "leeca01", "leeca01", "leeca01", "leeca01", "leeca01", "leeca01", "leeca01", "leeca01", "leeca01", "leeca01", "leeca01", "leeca01",
+#> "leeca01", "leeca01", "leeca01", "leeca01", "marquja01", "marquja01", "marquja01", "marquja01", "marquja01", "marquja01", "marquja01", "marquja01", "marquja01", "marquja01", "marquja01", "marquja01", "marquja01", "marquja01", "marquja01", "marquja01", "marquja01", "lopezfe01", "lopezfe01", "lopezfe01", "lopezfe01", "lopezfe01", "lopezfe01", "lopezfe01", "lopezfe01", "lopezfe01", "lopezfe01", "lopezfe01", "lopezfe01", "lopezfe01", "lopezfe01", "lopezfe01", "lopezfe01", "roberbr01", "roberbr01", "roberbr01",
+#> "roberbr01", "roberbr01", "roberbr01", "roberbr01", "roberbr01", "roberbr01", "roberbr01", "roberbr01", "roberbr01", "roberbr01", "roberbr01", "damonjo01", "damonjo01", "damonjo01", "damonjo01", "damonjo01", "damonjo01", "damonjo01", "damonjo01", "damonjo01", "damonjo01", "damonjo01", "damonjo01", "damonjo01", "damonjo01", "damonjo01", "damonjo01", "damonjo01", "damonjo01", "youngmi02", "youngmi02", "youngmi02", "youngmi02", "youngmi02", "youngmi02", "youngmi02", "youngmi02", "youngmi02", "youngmi02",
+#> "youngmi02", "youngmi02", "youngmi02", "youngmi02", "youngmi02", "loducpa01", "loducpa01", "loducpa01", "loducpa01", "loducpa01", "loducpa01", "loducpa01", "loducpa01", "loducpa01", "loducpa01", "loducpa01", "loducpa01", "loducpa01", "polanpl01", "polanpl01", "polanpl01", "polanpl01", "polanpl01", "polanpl01", "polanpl01", "polanpl01", "polanpl01", "polanpl01", "polanpl01", "polanpl01", "polanpl01", "polanpl01", "polanpl01", "polanpl01", "polanpl01", "polanpl01", "eckstda01", "eckstda01", "eckstda01",
+#> "eckstda01", "eckstda01", "eckstda01", "eckstda01", "eckstda01", "eckstda01", "eckstda01", "eckstda01", "lasorto01", "lasorto01", "lasorto01", "johnsji04", "johnsji04", "johnsji04", "johnsji04", "johnsji04", "johnsji04", "johnsji04", "johnsji04", "johnsji04", "johnsji04", "johnsji04", "johnsji04", "webbbr01", "webbbr01", "webbbr01", "webbbr01", "webbbr01", "webbbr01", "webbbr01", "grudzma01", "grudzma01", "grudzma01", "grudzma01", "grudzma01", "grudzma01", "grudzma01", "grudzma01", "grudzma01", "grudzma01",
+#> "grudzma01", "grudzma01", "grudzma01", "grudzma01", "grudzma01", "grudzma01", "morneju01", "morneju01", "morneju01", "morneju01", "morneju01", "morneju01", "morneju01", "morneju01", "morneju01", "morneju01", "morneju01", "morneju01", "morneju01", "morneju01", "suppaje01", "suppaje01", "suppaje01", "suppaje01", "suppaje01", "suppaje01", "suppaje01", "suppaje01", "suppaje01", "suppaje01", "suppaje01", "suppaje01", "suppaje01", "suppaje01", "suppaje01", "suppaje01", "suppaje01", "suppaje01", "suppaje01",
+#> "suppaje01", "rodrifr03", "rodrifr03", "rodrifr03", "rodrifr03", "rodrifr03", "rodrifr03", "rodrifr03", "rodrifr03", "rodrifr03", "rodrifr03", "rodrifr03", "rodrifr03", "rodrifr03", "rodrifr03", "rodrifr03", "rodrifr03", "verlaju01", "verlaju01", "verlaju01", "verlaju01", "verlaju01", "verlaju01", "verlaju01", "verlaju01", "verlaju01", "verlaju01", "verlaju01", "ramirha01", "ramirha01", "ramirha01", "ramirha01", "ramirha01", "ramirha01", "ramirha01", "ramirha01", "ramirha01", "ramirha01", "ramirha01",
+#> "ramirha01", "canoro01", "canoro01", "canoro01", "canoro01", "canoro01", "canoro01", "canoro01", "canoro01", "canoro01", "canoro01", "canoro01", "credejo01", "credejo01", "credejo01", "credejo01", "credejo01", "credejo01", "credejo01", "credejo01", "credejo01", "credejo01", "mauerjo01", "mauerjo01", "mauerjo01", "mauerjo01", "mauerjo01", "mauerjo01", "mauerjo01", "mauerjo01", "mauerjo01", "mauerjo01", "mauerjo01", "mauerjo01", "utleych01", "utleych01", "utleych01", "utleych01", "utleych01", "utleych01",
+#> "utleych01", "utleych01", "utleych01", "utleych01", "utleych01", "utleych01", "utleych01", "utleych01", "mccanbr01", "mccanbr01", "mccanbr01", "mccanbr01", "mccanbr01", "mccanbr01", "mccanbr01", "mccanbr01", "mccanbr01", "mccanbr01", "mccanbr01", "hollima01", "hollima01", "hollima01", "hollima01", "hollima01", "hollima01", "hollima01", "hollima01", "hollima01", "hollima01", "hollima01", "hollima01", "hollima01", "zambrca01", "zambrca01", "zambrca01", "zambrca01", "zambrca01", "zambrca01", "zambrca01",
+#> "zambrca01", "zambrca01", "zambrca01", "zambrca01", "zambrca01", "reyesjo01", "reyesjo01", "reyesjo01", "reyesjo01", "reyesjo01", "reyesjo01", "reyesjo01", "reyesjo01", "reyesjo01", "reyesjo01", "reyesjo01", "reyesjo01", "reyesjo01", "reyesjo01", "wrighda03", "wrighda03", "wrighda03", "wrighda03", "wrighda03", "wrighda03", "wrighda03", "wrighda03", "wrighda03", "wrighda03", "wrighda03", "wrighda03", "berkmla01", "berkmla01", "berkmla01", "berkmla01", "berkmla01", "berkmla01", "berkmla01", "berkmla01",
+#> "berkmla01", "berkmla01", "berkmla01", "berkmla01", "berkmla01", "berkmla01", "berkmla01", "berkmla01", "papeljo01", "papeljo01", "papeljo01", "papeljo01", "papeljo01", "papeljo01", "papeljo01", "papeljo01", "papeljo01", "papeljo01", "papeljo01", "papeljo01", "penaca01", "penaca01", "penaca01", "penaca01", "penaca01", "penaca01", "penaca01", "penaca01", "penaca01", "penaca01", "penaca01", "penaca01", "penaca01", "penaca01", "penaca01", "penaca01", "youngdm01", "youngdm01", "youngdm01", "youngdm01",
+#> "youngdm01", "youngdm01", "youngdm01", "youngdm01", "youngdm01", "youngdm01", "youngdm01", "youngdm01", "youngdm01", "sabatcc01", "sabatcc01", "sabatcc01", "sabatcc01", "sabatcc01", "sabatcc01", "sabatcc01", "sabatcc01", "sabatcc01", "sabatcc01", "sabatcc01", "sabatcc01", "sabatcc01", "sabatcc01", "sabatcc01", "sabatcc01", "peavyja01", "peavyja01", "peavyja01", "peavyja01", "peavyja01", "peavyja01", "peavyja01", "peavyja01", "peavyja01", "peavyja01", "peavyja01", "peavyja01", "peavyja01", "peavyja01",
+#> "peavyja01", "peavyja01", "peavyja01", "youklke01", "youklke01", "youklke01", "youklke01", "youklke01", "youklke01", "youklke01", "youklke01", "youklke01", "youklke01", "youklke01", "sizemgr01", "sizemgr01", "sizemgr01", "sizemgr01", "sizemgr01", "sizemgr01", "sizemgr01", "sizemgr01", "sizemgr01", "sizemgr01", "sizemgr01", "sizemgr01", "martiru01", "martiru01", "martiru01", "martiru01", "martiru01", "martiru01", "martiru01", "martiru01", "martiru01", "martiru01", "francje02", "francje02", "francje02",
+#> "francje02", "francje02", "francje02", "francje02", "francje02", "francje02", "francje02", "francje02", "francje02", "francje02", "francje02", "rowanaa01", "rowanaa01", "rowanaa01", "rowanaa01", "rowanaa01", "rowanaa01", "rowanaa01", "rowanaa01", "rowanaa01", "rowanaa01", "rowanaa01", "rolliji01", "rolliji01", "rolliji01", "rolliji01", "rolliji01", "rolliji01", "rolliji01", "rolliji01", "rolliji01", "rolliji01", "rolliji01", "rolliji01", "rolliji01", "rolliji01", "rolliji01", "rolliji01", "fieldpr01",
+#> "fieldpr01", "fieldpr01", "fieldpr01", "fieldpr01", "fieldpr01", "fieldpr01", "fieldpr01", "fieldpr01", "fieldpr01", "fieldpr01", "sweenmi01", "sweenmi01", "sweenmi01", "sweenmi01", "sweenmi01", "sweenmi01", "sweenmi01", "sweenmi01", "sweenmi01", "sweenmi01", "sweenmi01", "sweenmi01", "sweenmi01", "sweenmi01", "sweenmi01", "sweenmi01", "sweenmi01", "timlimi01", "timlimi01", "timlimi01", "timlimi01", "timlimi01", "timlimi01", "timlimi01", "timlimi01", "timlimi01", "timlimi01", "timlimi01", "timlimi01",
+#> "timlimi01", "timlimi01", "timlimi01", "timlimi01", "timlimi01", "timlimi01", "timlimi01", "timlimi01", "timlimi01", "putzjj01", "putzjj01", "putzjj01", "putzjj01", "putzjj01", "putzjj01", "putzjj01", "putzjj01", "putzjj01", "putzjj01", "putzjj01", "putzjj01", "valvejo01", "valvejo01", "valvejo01", "valvejo01", "valvejo01", "valvejo01", "valvejo01", "valvejo01", "valvejo01", "valvejo01", "valvejo01", "valvejo01", "pedrodu01", "pedrodu01", "pedrodu01", "pedrodu01", "pedrodu01", "pedrodu01", "pedrodu01",
+#> "pedrodu01", "pedrodu01", "pedrodu01", "braunry02", "braunry02", "braunry02", "braunry02", "braunry02", "braunry02", "braunry02", "braunry02", "braunry02", "owingmi01", "owingmi01", "owingmi01", "owingmi01", "owingmi01", "owingmi01", "owingmi01", "borowjo01", "borowjo01", "borowjo01", "borowjo01", "borowjo01", "borowjo01", "borowjo01", "borowjo01", "borowjo01", "borowjo01", "borowjo01", "borowjo01", "borowjo01", "borowjo01", "garzama01", "garzama01", "garzama01", "garzama01", "garzama01", "garzama01",
+#> "garzama01", "garzama01", "garzama01", "garzama01", "garzama01", "hamelco01", "hamelco01", "hamelco01", "hamelco01", "hamelco01", "hamelco01", "hamelco01", "hamelco01", "hamelco01", "hamelco01", "hamelco01", "leecl02", "leecl02", "leecl02", "leecl02", "leecl02", "leecl02", "leecl02", "leecl02", "leecl02", "leecl02", "leecl02", "leecl02", "leecl02", "leecl02", "leecl02", "lidgebr01", "lidgebr01", "lidgebr01", "lidgebr01", "lidgebr01", "lidgebr01", "lidgebr01", "lidgebr01", "lidgebr01", "lidgebr01",
+#> "lidgebr01", "linceti01", "linceti01", "linceti01", "linceti01", "linceti01", "linceti01", "linceti01", "linceti01", "linceti01", "gonzaad01", "gonzaad01", "gonzaad01", "gonzaad01", "gonzaad01", "gonzaad01", "gonzaad01", "gonzaad01", "gonzaad01", "gonzaad01", "gonzaad01", "gonzaad01", "gonzaad01", "phillbr01", "phillbr01", "phillbr01", "phillbr01", "phillbr01", "phillbr01", "phillbr01", "phillbr01", "phillbr01", "phillbr01", "phillbr01", "phillbr01", "phillbr01", "phillbr01", "molinya01", "molinya01",
+#> "molinya01", "molinya01", "molinya01", "molinya01", "molinya01", "molinya01", "molinya01", "molinya01", "molinya01", "molinya01", "mclouna01", "mclouna01", "mclouna01", "mclouna01", "mclouna01", "mclouna01", "mclouna01", "mclouna01", "mclouna01", "mclouna01", "mclouna01", "mclouna01", "victosh01", "victosh01", "victosh01", "victosh01", "victosh01", "victosh01", "victosh01", "victosh01", "victosh01", "victosh01", "victosh01", "victosh01", "victosh01", "victosh01", "ramirar01", "ramirar01", "ramirar01",
+#> "ramirar01", "ramirar01", "ramirar01", "ramirar01", "ramirar01", "ramirar01", "ramirar01", "ramirar01", "ramirar01", "ramirar01", "ramirar01", "ramirar01", "ramirar01", "ramirar01", "ramirar01", "ramirar01", "ramirar01", "lestejo01", "lestejo01", "lestejo01", "lestejo01", "lestejo01", "lestejo01", "lestejo01", "lestejo01", "lestejo01", "lestejo01", "lestejo01", "longoev01", "longoev01", "longoev01", "longoev01", "longoev01", "longoev01", "longoev01", "longoev01", "sotoge01", "sotoge01", "sotoge01",
+#> "sotoge01", "sotoge01", "sotoge01", "sotoge01", "sotoge01", "sotoge01", "sotoge01", "sotoge01", "sotoge01", "sotoge01", "huffau01", "huffau01", "huffau01", "huffau01", "huffau01", "huffau01", "huffau01", "huffau01", "huffau01", "huffau01", "huffau01", "huffau01", "huffau01", "huffau01", "huffau01", "hamiljo03", "hamiljo03", "hamiljo03", "hamiljo03", "hamiljo03", "hamiljo03", "hamiljo03", "hamiljo03", "hamiljo03", "quentca01", "quentca01", "quentca01", "quentca01", "quentca01", "quentca01", "quentca01",
+#> "quentca01", "quentca01", "ludwiry01", "ludwiry01", "ludwiry01", "ludwiry01", "ludwiry01", "ludwiry01", "ludwiry01", "ludwiry01", "ludwiry01", "ludwiry01", "ludwiry01", "ludwiry01", "ludwiry01", "ludwiry01", "ludwiry01", "crawfca02", "crawfca02", "crawfca02", "crawfca02", "crawfca02", "crawfca02", "crawfca02", "crawfca02", "crawfca02", "crawfca02", "crawfca02", "crawfca02", "crawfca02", "crawfca02", "hillaa01", "hillaa01", "hillaa01", "hillaa01", "hillaa01", "hillaa01", "hillaa01", "hillaa01", "hillaa01",
+#> "hillaa01", "hillaa01", "hillaa01", "carpech02", "carpech02", "greinza01", "greinza01", "greinza01", "greinza01", "greinza01", "greinza01", "greinza01", "greinza01", "greinza01", "greinza01", "greinza01", "greinza01", "greinza01", "jonesad01", "jonesad01", "jonesad01", "jonesad01", "jonesad01", "jonesad01", "jonesad01", "jonesad01", "jonesad01", "jonesad01", "buehrma01", "buehrma01", "buehrma01", "buehrma01", "buehrma01", "buehrma01", "buehrma01", "buehrma01", "buehrma01", "buehrma01", "buehrma01",
+#> "buehrma01", "buehrma01", "buehrma01", "buehrma01", "buehrma01", "zimmery01", "zimmery01", "zimmery01", "zimmery01", "zimmery01", "zimmery01", "zimmery01", "zimmery01", "zimmery01", "zimmery01", "zimmery01", "bournmi01", "bournmi01", "bournmi01", "bournmi01", "bournmi01", "bournmi01", "bournmi01", "bournmi01", "bournmi01", "bournmi01", "bournmi01", "bournmi01", "kempma01", "kempma01", "kempma01", "kempma01", "kempma01", "kempma01", "kempma01", "kempma01", "kempma01", "kempma01", "wainwad01", "wainwad01",
+#> "wainwad01", "wainwad01", "wainwad01", "wainwad01", "wainwad01", "wainwad01", "wainwad01", "wainwad01", "teahema01", "teahema01", "teahema01", "teahema01", "teahema01", "teahema01", "teahema01", "teahema01", "bellhe01", "bellhe01", "bellhe01", "bellhe01", "bellhe01", "bellhe01", "bellhe01", "bellhe01", "bellhe01", "bellhe01", "bellhe01", "bailean01", "bailean01", "bailean01", "bailean01", "bailean01", "bailean01", "coghlch01", "coghlch01", "coghlch01", "coghlch01", "coghlch01", "coghlch01", "coghlch01",
+#> "lindad01", "lindad01", "lindad01", "lindad01", "lindad01", "lindad01", "lindad01", "lindad01", "lindad01", "lindad01", "ethiean01", "ethiean01", "ethiean01", "ethiean01", "ethiean01", "ethiean01", "ethiean01", "ethiean01", "ethiean01", "ethiean01", "frankry01", "frankry01", "frankry01", "frankry01", "frankry01", "frankry01", "frankry01", "frankry01", "frankry01", "frankry01", "frankry01", "frankry01", "frankry01", "matsuhi01", "matsuhi01", "matsuhi01", "matsuhi01", "matsuhi01", "matsuhi01", "matsuhi01",
+#> "matsuhi01", "matsuhi01", "matsuhi01", "liriafr01", "liriafr01", "liriafr01", "liriafr01", "liriafr01", "liriafr01", "liriafr01", "liriafr01", "liriafr01", "liriafr01", "liriafr01", "hudsoti01", "hudsoti01", "hudsoti01", "hudsoti01", "hudsoti01", "hudsoti01", "hudsoti01", "hudsoti01", "hudsoti01", "hudsoti01", "hudsoti01", "hudsoti01", "hudsoti01", "hudsoti01", "hudsoti01", "hudsoti01", "hudsoti01", "hernafe02", "hernafe02", "hernafe02", "hernafe02", "hernafe02", "hernafe02", "hernafe02", "hernafe02",
+#> "hernafe02", "hernafe02", "hernafe02", "gutiefr01", "gutiefr01", "gutiefr01", "gutiefr01", "gutiefr01", "gutiefr01", "gutiefr01", "gutiefr01", "gutiefr01", "gutiefr01", "gonzaca01", "gonzaca01", "gonzaca01", "gonzaca01", "gonzaca01", "gonzaca01", "gonzaca01", "gonzaca01", "arroybr01", "arroybr01", "arroybr01", "arroybr01", "arroybr01", "arroybr01", "arroybr01", "arroybr01", "arroybr01", "arroybr01", "arroybr01", "arroybr01", "arroybr01", "arroybr01", "arroybr01", "tulowtr01", "tulowtr01", "tulowtr01",
+#> "tulowtr01", "tulowtr01", "tulowtr01", "tulowtr01", "tulowtr01", "tulowtr01", "tulowtr01", "tulowtr01", "bautijo02", "bautijo02", "bautijo02", "bautijo02", "bautijo02", "bautijo02", "bautijo02", "bautijo02", "bautijo02", "bautijo02", "bautijo02", "bautijo02", "bautijo02", "bautijo02", "bautijo02", "bautijo02", "vottojo01", "vottojo01", "vottojo01", "vottojo01", "vottojo01", "vottojo01", "vottojo01", "vottojo01", "vottojo01", "rossco01", "rossco01", "rossco01", "rossco01", "rossco01", "rossco01",
+#> "rossco01", "rossco01", "rossco01", "rossco01", "rossco01", "rossco01", "rossco01", "rossco01", "rossco01", "wakefti01", "wakefti01", "wakefti01", "wakefti01", "wakefti01", "wakefti01", "wakefti01", "wakefti01", "wakefti01", "wakefti01", "wakefti01", "wakefti01", "wakefti01", "wakefti01", "wakefti01", "wakefti01", "wakefti01", "wakefti01", "wakefti01", "soriara01", "soriara01", "soriara01", "soriara01", "soriara01", "soriara01", "soriara01", "soriara01", "soriara01", "soriara01", "soriara01", "soriara01",
+#> "soriara01", "soriara01", "felizne01", "felizne01", "felizne01", "felizne01", "felizne01", "felizne01", "felizne01", "felizne01", "poseybu01", "poseybu01", "poseybu01", "poseybu01", "poseybu01", "poseybu01", "poseybu01", "ramiral03", "ramiral03", "ramiral03", "ramiral03", "ramiral03", "ramiral03", "ramiral03", "ramiral03", "ugglada01", "ugglada01", "ugglada01", "ugglada01", "ugglada01", "ugglada01", "ugglada01", "ugglada01", "ugglada01", "ugglada01", "ugglada01", "gallayo01", "gallayo01", "gallayo01",
+#> "gallayo01", "gallayo01", "gallayo01", "gallayo01", "gallayo01", "gallayo01", "cruzne02", "cruzne02", "cruzne02", "cruzne02", "cruzne02", "cruzne02", "cruzne02", "cruzne02", "cruzne02", "cruzne02", "cruzne02", "freesda01", "freesda01", "freesda01", "freesda01", "freesda01", "freesda01", "freesda01", "ellsbja01", "ellsbja01", "ellsbja01", "ellsbja01", "ellsbja01", "ellsbja01", "ellsbja01", "ellsbja01", "ellsbja01", "kershcl01", "kershcl01", "kershcl01", "kershcl01", "kershcl01", "kershcl01", "kershcl01",
+#> "kershcl01", "wietema01", "wietema01", "wietema01", "wietema01", "wietema01", "wietema01", "wietema01", "gordoal01", "gordoal01", "gordoal01", "gordoal01", "gordoal01", "gordoal01", "gordoal01", "gordoal01", "gordoal01", "markani01", "markani01", "markani01", "markani01", "markani01", "markani01", "markani01", "markani01", "markani01", "markani01", "aybarer01", "aybarer01", "aybarer01", "aybarer01", "aybarer01", "aybarer01", "aybarer01", "aybarer01", "aybarer01", "aybarer01", "parrage01", "parrage01",
+#> "parrage01", "parrage01", "parrage01", "parrage01", "parrage01", "parrage01", "parrage01", "butlebi03", "butlebi03", "butlebi03", "butlebi03", "butlebi03", "butlebi03", "butlebi03", "butlebi03", "butlebi03", "axforjo01", "axforjo01", "axforjo01", "axforjo01", "axforjo01", "axforjo01", "axforjo01", "axforjo01", "axforjo01", "hellije01", "hellije01", "hellije01", "hellije01", "hellije01", "hellije01", "kimbrcr01", "kimbrcr01", "kimbrcr01", "kimbrcr01", "kimbrcr01", "kimbrcr01", "avilaal01", "avilaal01",
+#> "avilaal01", "avilaal01", "avilaal01", "avilaal01", "avilaal01", "grandcu01", "grandcu01", "grandcu01", "grandcu01", "grandcu01", "grandcu01", "grandcu01", "grandcu01", "grandcu01", "grandcu01", "grandcu01", "grandcu01", "cabreas01", "cabreas01", "cabreas01", "cabreas01", "cabreas01", "cabreas01", "cabreas01", "cabreas01", "cabreas01", "cabreas01", "uptonju01", "uptonju01", "uptonju01", "uptonju01", "uptonju01", "uptonju01", "uptonju01", "uptonju01", "uptonju01", "hudsoda01", "hudsoda01", "hudsoda01",
+#> "hudsoda01", "hudsoda01", "hudsoda01", "hudsoda01", "youngde03", "youngde03", "youngde03", "youngde03", "youngde03", "youngde03", "youngde03", "youngde03", "youngde03", "youngde03", "youngde03", "youngde03", "cabreme01", "cabreme01", "cabreme01", "cabreme01", "cabreme01", "cabreme01", "cabreme01", "cabreme01", "cabreme01", "cabreme01", "cabreme01", "sandopa01", "sandopa01", "sandopa01", "sandopa01", "sandopa01", "sandopa01", "sandopa01", "sandopa01", "dickera01", "dickera01", "dickera01", "dickera01",
+#> "dickera01", "dickera01", "dickera01", "dickera01", "dickera01", "dickera01", "dickera01", "dickera01", "dickera01", "rodnefe01", "rodnefe01", "rodnefe01", "rodnefe01", "rodnefe01", "rodnefe01", "rodnefe01", "rodnefe01", "rodnefe01", "rodnefe01", "rodnefe01", "rodnefe01", "rodnefe01", "rodnefe01", "priceda01", "priceda01", "priceda01", "priceda01", "priceda01", "priceda01", "priceda01", "priceda01", "priceda01", "priceda01", "reddijo01", "reddijo01", "reddijo01", "reddijo01", "reddijo01", "reddijo01",
+#> "reddijo01", "hardyjj01", "hardyjj01", "hardyjj01", "hardyjj01", "hardyjj01", "hardyjj01", "hardyjj01", "hardyjj01", "hardyjj01", "hardyjj01", "hardyjj01", "larocad01", "larocad01", "larocad01", "larocad01", "larocad01", "larocad01", "larocad01", "larocad01", "larocad01", "larocad01", "larocad01", "larocad01", "larocad01", "larocad01", "barneda01", "barneda01", "barneda01", "barneda01", "barneda01", "barneda01", "barneda01", "barneda01", "headlch01", "headlch01", "headlch01", "headlch01", "headlch01",
+#> "headlch01", "headlch01", "headlch01", "headlch01", "headlch01", "mccutan01", "mccutan01", "mccutan01", "mccutan01", "mccutan01", "mccutan01", "mccutan01", "heywaja01", "heywaja01", "heywaja01", "heywaja01", "heywaja01", "heywaja01", "scutama01", "scutama01", "scutama01", "scutama01", "scutama01", "scutama01", "scutama01", "scutama01", "scutama01", "scutama01", "scutama01", "scutama01", "scutama01", "scutama01", "troutmi01", "troutmi01", "troutmi01", "troutmi01", "troutmi01", "harpebr03", "harpebr03",
+#> "harpebr03", "harpebr03", "pierzaj01", "pierzaj01", "pierzaj01", "pierzaj01", "pierzaj01", "pierzaj01", "pierzaj01", "pierzaj01", "pierzaj01", "pierzaj01", "pierzaj01", "pierzaj01", "pierzaj01", "pierzaj01", "pierzaj01", "pierzaj01", "pierzaj01", "pierzaj01", "pierzaj01", "willijo03", "willijo03", "willijo03", "willijo03", "willijo03", "willijo03", "willijo03", "willijo03", "willijo03", "willijo03", "willijo03", "willijo03", "braunry01", "braunry01", "bruceja01", "bruceja01", "bruceja01", "bruceja01",
+#> "bruceja01", "bruceja01", "bruceja01", "bruceja01", "strasst01", "strasst01", "strasst01", "strasst01", "strasst01", "strasst01", "desmoia01", "desmoia01", "desmoia01", "desmoia01", "desmoia01", "desmoia01", "desmoia01", "ueharko01", "ueharko01", "ueharko01", "ueharko01", "ueharko01", "ueharko01", "ueharko01", "ueharko01", "scherma01", "scherma01", "scherma01", "scherma01", "scherma01", "scherma01", "scherma01", "scherma01", "hosmeer01", "hosmeer01", "hosmeer01", "hosmeer01", "hosmeer01", "machama01",
+#> "machama01", "machama01", "machama01", "perezsa02", "perezsa02", "perezsa02", "perezsa02", "perezsa02", "goldspa01", "goldspa01", "goldspa01", "goldspa01", "goldspa01", "arenano01", "arenano01", "arenano01", "gomezca01", "gomezca01", "gomezca01", "gomezca01", "gomezca01", "gomezca01", "gomezca01", "gomezca01", "gomezca01", "gomezca01", "simmoan01", "simmoan01", "simmoan01", "simmoan01", "wachami01", "wachami01", "wachami01", "myerswi01", "myerswi01", "myerswi01", "fernajo02", "fernajo02", "fernajo02",
+#> "davisch02", "davisch02", "davisch02", "davisch02", "davisch02", "davisch02", "davisch02", "davisch02", "davisch02", "carpema01", "carpema01", "carpema01", "carpema01", "carpema01", "alvarpe01", "alvarpe01", "alvarpe01", "alvarpe01", "alvarpe01", "alvarpe01", "cuddymi01", "cuddymi01", "cuddymi01", "cuddymi01", "cuddymi01", "cuddymi01", "cuddymi01", "cuddymi01", "cuddymi01", "cuddymi01", "cuddymi01", "cuddymi01", "cuddymi01", "cuddymi01", "cuddymi01", "cainlo01", "cainlo01", "cainlo01", "cainlo01",
+#> "cainlo01", "cainlo01", "rizzoan01", "rizzoan01", "rizzoan01", "rizzoan01", "rizzoan01", "youngch03", "youngch03", "youngch03", "youngch03", "youngch03", "youngch03", "youngch03", "youngch03", "youngch03", "youngch03", "youngch03", "mcgehca01", "mcgehca01", "mcgehca01", "mcgehca01", "mcgehca01", "mcgehca01", "mcgehca01", "mcgehca01", "mcgehca01", "klubeco01", "klubeco01", "klubeco01", "klubeco01", "klubeco01", "seageky01", "seageky01", "seageky01", "seageky01", "seageky01", "keuchda01", "keuchda01",
+#> "keuchda01", "keuchda01", "lemahdj01", "lemahdj01", "lemahdj01", "lemahdj01", "lemahdj01", "lagarju01", "lagarju01", "lagarju01", "yelicch01", "yelicch01", "yelicch01", "stantmi03", "stantmi03", "stantmi03", "stantmi03", "stantmi03", "stantmi03", "bumgama01", "bumgama01", "bumgama01", "bumgama01", "bumgama01", "bumgama01", "bumgama01", "abreujo02", "abreujo02", "degroja01", "degroja01", "altuvjo01", "altuvjo01", "altuvjo01", "altuvjo01", "altuvjo01", "gomesya01", "gomesya01", "gomesya01", "gomesya01",
+#> "brantmi02", "brantmi02", "brantmi02", "brantmi02", "brantmi02", "brantmi02", "brantmi02", "walkene01", "walkene01", "walkene01", "walkene01", "walkene01", "walkene01", "walkene01", "rendoan01", "rendoan01", "rendoan01", "escobal02", "escobal02", "escobal02", "escobal02", "escobal02", "escobal02", "escobal02", "escobal02", "harvema01", "harvema01", "harvema01", "arrieja01", "arrieja01", "arrieja01", "arrieja01", "arrieja01", "arrieja01", "arrieja01", "kiermke01", "kiermke01", "kiermke01", "cespeyo01",
+#> "cespeyo01", "cespeyo01", "cespeyo01", "cespeyo01", "cespeyo01", "calhoko01", "calhoko01", "calhoko01", "calhoko01", "gordode01", "gordode01", "gordode01", "gordode01", "gordode01", "polloaj01", "polloaj01", "polloaj01", "polloaj01", "martest01", "martest01", "martest01", "martest01", "crawfbr01", "crawfbr01", "crawfbr01", "crawfbr01", "crawfbr01", "donaljo02", "donaljo02", "donaljo02", "donaljo02", "donaljo02", "murphda08", "murphda08", "murphda08", "murphda08", "murphda08", "murphda08", "murphda08",
+#> "correca01", "bryankr01", "moralke01", "moralke01", "moralke01", "moralke01", "moralke01", "moralke01", "moralke01", "moralke01", "moralke01", "moralke01", "martijd02", "martijd02", "martijd02", "martijd02", "martijd02", "bogaexa01", "bogaexa01", "bogaexa01") x c(1874, 1875, 1876, 1877, 1878, 1879, 1880, 1881, 1882, 1884, 1884, 1872, 1873, 1874, 1875, 1876, 1877, 1878, 1879, 1880, 1881, 1882, 1883, 1884, 1885, 1886, 1887, 1888, 1889, 1890, 1890, 1891, 1882, 1883, 1884, 1885, 1886, 1887, 1888, 1889, 1890, 1880, 1881, 1882, 1883, 1884, 1885, 1886, 1887, 1888, 1889, 1890, 1891, 1883, 1884, 1885, 1886, 1887, 1888, 1889, 1890, 1891, 1892, 1880, 1881, 1882, 1883, 1884, 1885, 1886, 1887, 1888, 1889, 1890, 1891, 1891, 1892, 1893, 1882, 1884, 1885, 1886, 1887, 1888,
+#> 1889, 1890, 1891, 1892, 1892, 1893, 1894, 1889, 1890, 1891, 1892, 1893, 1894, 1895, 1897, 1898, 1901, 1888, 1889, 1890, 1891, 1892, 1893, 1894, 1895, 1896, 1897, 1898, 1899, 1900, 1901, 1904, 1905, 1906, 1890, 1891, 1892, 1893, 1894, 1895, 1896, 1897, 1898, 1899, 1900, 1901, 1902, 1903, 1904, 1905, 1906, 1907, 1908, 1909, 1910, 1911, 1911, 1896, 1897, 1898, 1899, 1900, 1901, 1902, 1902, 1903, 1904, 1905, 1906, 1907, 1908, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1916, 1897, 1899, 1900, 1901, 1901,
+#> 1902, 1903, 1904, 1905, 1906, 1907, 1908, 1909, 1910, 1900, 1901, 1902, 1903, 1904, 1905, 1906, 1907, 1908, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1916, 1916, 1905, 1906, 1907, 1908, 1909, 1910, 1911, 1912, 1913, 1913, 1914, 1914, 1915, 1916, 1917, 1918, 1919, 1907, 1908, 1909, 1910, 1910, 1911, 1912, 1913, 1914, 1915, 1896, 1897, 1898, 1899, 1900, 1901, 1902, 1903, 1904, 1905, 1906, 1907, 1908, 1909, 1910, 1912, 1899, 1900, 1901, 1902, 1903, 1904, 1905, 1906, 1907, 1908, 1909, 1910, 1911, 1912,
+#> 1914, 1916, 1899, 1900, 1901, 1902, 1903, 1904, 1905, 1906, 1907, 1908, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1916, 1917, 1903, 1905, 1906, 1907, 1908, 1909, 1910, 1904, 1905, 1906, 1907, 1908, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1916, 1917, 1902, 1903, 1904, 1905, 1906, 1907, 1908, 1909, 1910, 1898, 1899, 1900, 1901, 1902, 1903, 1904, 1905, 1906, 1907, 1908, 1909, 1910, 1911, 1912, 1915, 1916, 1918, 1905, 1906, 1907, 1908, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1916, 1917, 1918, 1919,
+#> 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1894, 1895, 1896, 1897, 1898, 1899, 1900, 1901, 1902, 1903, 1904, 1905, 1906, 1907, 1908, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1916, 1917, 1918, 1904, 1905, 1906, 1907, 1908, 1909, 1910, 1911, 1912, 1913, 1897, 1900, 1901, 1902, 1902, 1903, 1904, 1905, 1906, 1907, 1908, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1900, 1901, 1902, 1903, 1904, 1905, 1906, 1907, 1908, 1910, 1911, 1911, 1912, 1913, 1899, 1900, 1901, 1902, 1903, 1904, 1904, 1905,
+#> 1906, 1908, 1911, 1911, 1912, 1914, 1894, 1895, 1896, 1897, 1898, 1899, 1900, 1901, 1902, 1903, 1904, 1905, 1906, 1907, 1908, 1909, 1910, 1911, 1913, 1914, 1915, 1903, 1904, 1905, 1906, 1907, 1908, 1909, 1910, 1911, 1912, 1913, 1914, 1914, 1915, 1916, 1907, 1908, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1916, 1897, 1898, 1899, 1900, 1901, 1902, 1903, 1904, 1905, 1906, 1907, 1908, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1916, 1917, 1894, 1895, 1896, 1897, 1898, 1899, 1900, 1901, 1902, 1903, 1904,
+#> 1905, 1906, 1907, 1908, 1909, 1911, 1902, 1903, 1904, 1905, 1906, 1907, 1908, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1916, 1917, 1917, 1922, 1929, 1898, 1899, 1900, 1901, 1902, 1903, 1904, 1905, 1906, 1907, 1908, 1909, 1910, 1905, 1906, 1907, 1908, 1909, 1910, 1911, 1912, 1913, 1913, 1914, 1915, 1916, 1917, 1904, 1905, 1906, 1907, 1908, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1916, 1916, 1917, 1917, 1918, 1906, 1907, 1908, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1916, 1917, 1918, 1919, 1920,
+#> 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1906, 1908, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1916, 1904, 1905, 1905, 1905, 1908, 1909, 1910, 1911, 1912, 1931, 1907, 1908, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1916, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1901, 1902, 1903, 1904, 1905, 1906, 1907, 1908, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1916, 1917, 1907, 1908, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1916, 1917, 1918, 1919, 1920, 1921,
+#> 1922, 1923, 1924, 1925, 1926, 1927, 1902, 1903, 1904, 1905, 1906, 1907, 1908, 1909, 1910, 1911, 1912, 1913, 1913, 1914, 1915, 1908, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1917, 1918, 1919, 1920, 1921, 1922, 1908, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1916, 1917, 1918, 1919, 1920, 1921, 1921, 1922, 1923, 1905, 1906, 1907, 1908, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1916, 1917, 1918, 1906, 1907, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1916, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925,
+#> 1926, 1898, 1899, 1900, 1901, 1902, 1903, 1904, 1905, 1906, 1907, 1908, 1909, 1910, 1911, 1912, 1913, 1914, 1898, 1899, 1900, 1901, 1902, 1903, 1904, 1905, 1906, 1907, 1908, 1909, 1910, 1911, 1912, 1912, 1913, 1914, 1915, 1918, 1904, 1906, 1907, 1908, 1909, 1910, 1911, 1912, 1913, 1913, 1914, 1915, 1903, 1904, 1905, 1906, 1907, 1908, 1909, 1910, 1911, 1912, 1912, 1913, 1914, 1915, 1916, 1916, 1906, 1907, 1908, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1908, 1909, 1910, 1911, 1912, 1913, 1914, 1915,
+#> 1919, 1906, 1907, 1908, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1916, 1917, 1918, 1920, 1903, 1904, 1905, 1906, 1907, 1908, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1916, 1917, 1925, 1904, 1907, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1916, 1917, 1918, 1918, 1918, 1904, 1905, 1906, 1907, 1908, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1916, 1917, 1917, 1918, 1919, 1909, 1910, 1911, 1912, 1912, 1914, 1915, 1908, 1909, 1910, 1911, 1912, 1913, 1914, 1916, 1917, 1918, 1919, 1921, 1922, 1906, 1909,
+#> 1910, 1911, 1912, 1913, 1914, 1915, 1916, 1917, 1918, 1919, 1920, 1925, 1911, 1912, 1913, 1914, 1914, 1915, 1916, 1918, 1925, 1908, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1915, 1916, 1917, 1918, 1919, 1920, 1902, 1903, 1904, 1905, 1906, 1907, 1908, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1915, 1916, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1916, 1917, 1917, 1911, 1912, 1913, 1914, 1915, 1916, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1926, 1927, 1928, 1929, 1930, 1910, 1911,
+#> 1912, 1913, 1914, 1915, 1916, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1907, 1908, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1916, 1916, 1917, 1918, 1919, 1920, 1903, 1905, 1906, 1907, 1908, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1916, 1917, 1908, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1915, 1916, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1916, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1908, 1909, 1910, 1911,
+#> 1912, 1913, 1914, 1915, 1916, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1910, 1911, 1912, 1913, 1914, 1915, 1916, 1917, 1918, 1919, 1920, 1921, 1921, 1922, 1923, 1923, 1924, 1902, 1906, 1907, 1908, 1909, 1910, 1911, 1912, 1913, 1915, 1916, 1918, 1907, 1908, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1916, 1916, 1917, 1918, 1919, 1907, 1908, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1916, 1917, 1918, 1919, 1920, 1921, 1908, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1916, 1912, 1913, 1914, 1915,
+#> 1916, 1917, 1918, 1913, 1914, 1915, 1916, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1903, 1905, 1906, 1907, 1908, 1908, 1909, 1910, 1911, 1913, 1914, 1915, 1915, 1917, 1908, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1915, 1916, 1917, 1919, 1912, 1913, 1914, 1915, 1916, 1908, 1909, 1909, 1912, 1913, 1914, 1915, 1916, 1917, 1918, 1919, 1920, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1916, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927,
+#> 1912, 1913, 1914, 1915, 1916, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1913, 1914, 1915, 1916, 1917, 1918, 1919, 1920, 1921, 1924, 1925, 1912, 1913, 1914, 1915, 1916, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1935, 1911, 1912, 1913, 1914, 1915, 1916, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1929, 1911, 1912, 1913, 1914, 1915, 1916, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925,
+#> 1913, 1914, 1915, 1919, 1913, 1914, 1915, 1916, 1917, 1918, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1916, 1917, 1912, 1913, 1913, 1914, 1915, 1916, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1912, 1913, 1914, 1915, 1916, 1917, 1918, 1919, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1915, 1916, 1917, 1918, 1919, 1920, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1911, 1912, 1913, 1914, 1915, 1916, 1917, 1919, 1912, 1913, 1914, 1915, 1916, 1917,
+#> 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1913, 1914, 1915, 1916, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1915, 1916, 1917, 1918, 1919, 1920, 1921, 1922, 1924, 1925, 1926, 1927, 1928, 1928, 1929, 1930, 1914, 1915, 1916, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1908, 1909, 1910, 1911, 1911, 1912, 1913, 1914, 1915, 1916, 1916, 1917, 1918, 1919, 1919, 1920, 1915, 1916, 1917, 1918, 1919,
+#> 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1933, 1934, 1935, 1936, 1937, 1910, 1911, 1911, 1912, 1913, 1914, 1915, 1916, 1917, 1919, 1920, 1921, 1922, 1923, 1923, 1924, 1925, 1929, 1930, 1912, 1914, 1915, 1916, 1917, 1919, 1919, 1920, 1921, 1921, 1922, 1912, 1913, 1914, 1915, 1916, 1917, 1918, 1919, 1920, 1915, 1916, 1917, 1918, 1919, 1920, 1905, 1908, 1909, 1910, 1911, 1912, 1912, 1913, 1914, 1915, 1916, 1917, 1918, 1919, 1920, 1912, 1913, 1914, 1915, 1916,
+#> 1917, 1918, 1919, 1920, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1916, 1917, 1918, 1919, 1920, 1921, 1913, 1914, 1915, 1916, 1916, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1931, 1910, 1911, 1912, 1913, 1914, 1915, 1916, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1926, 1927, 1928, 1929, 1912, 1913, 1914, 1915, 1916, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1926, 1911, 1912, 1913, 1914, 1915, 1916, 1917, 1918, 1919, 1920, 1921,
+#> 1922, 1923, 1924, 1925, 1927, 1928, 1909, 1910, 1911, 1912, 1913, 1914, 1915, 1916, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1908, 1910, 1911, 1912, 1912, 1913, 1914, 1915, 1916, 1917, 1918, 1919, 1920, 1921, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1912, 1913, 1914, 1915, 1916, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1916, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1930, 1931, 1932, 1933, 1933, 1934, 1934, 1934, 1910, 1912, 1913, 1913, 1914,
+#> 1915, 1916, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1913, 1914, 1915, 1916, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1909, 1911, 1914, 1915, 1916, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1925, 1925, 1915, 1916, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1923, 1924, 1925, 1926, 1927, 1915, 1916, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1912, 1916, 1917, 1918, 1919, 1920, 1921,
+#> 1922, 1923, 1912, 1916, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1916, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1914, 1915, 1916, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1925, 1926, 1926, 1916, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1914, 1915, 1916, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933,
+#> 1915, 1916, 1917, 1918, 1919, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1915, 1916, 1917, 1917, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1930, 1932, 1916, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1915, 1916, 1917, 1918, 1919, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1926, 1927, 1927, 1928, 1929, 1917, 1918,
+#> 1919, 1920, 1921, 1922, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1931, 1912, 1913, 1914, 1915, 1916, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1926, 1927, 1927, 1928, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1912, 1913, 1914, 1915, 1916, 1917, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1917, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1926, 1927, 1913, 1915, 1916, 1917, 1918,
+#> 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1915, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1934, 1914, 1916, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1932, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1933, 1933, 1934, 1936, 1915, 1916, 1917, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1926, 1927, 1928, 1929, 1930, 1920, 1921, 1922, 1923, 1924,
+#> 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1916, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1915, 1916, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1925, 1926, 1927, 1928, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1934, 1935, 1914, 1915, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1929, 1930, 1915,
+#> 1915, 1918, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1934, 1935, 1915, 1916, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1933, 1934, 1913, 1914, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1915, 1916, 1917, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1923, 1923, 1924, 1925, 1926, 1927, 1930, 1931, 1932, 1933, 1912, 1913, 1914, 1915, 1915, 1916, 1917, 1919,
+#> 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1937, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938,
+#> 1939, 1915, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1931, 1932, 1933, 1934, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1939, 1940, 1941, 1943, 1944, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932,
+#> 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1942, 1946, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1935, 1936, 1937, 1938, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1935, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1919, 1920, 1921, 1922, 1923, 1923, 1924, 1924, 1925, 1926, 1927, 1928, 1928, 1929, 1930, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1930, 1931,
+#> 1931, 1932, 1914, 1915, 1916, 1917, 1918, 1919, 1920, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1928, 1929, 1929, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1931, 1932, 1933, 1934, 1935, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1938, 1939, 1918, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1924, 1925, 1926,
+#> 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1934, 1917, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1927, 1928, 1929, 1930, 1921, 1925, 1926, 1927, 1928, 1929, 1930, 1930, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1939, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926,
+#> 1927, 1928, 1929, 1930, 1930, 1931, 1931, 1932, 1932, 1933, 1934, 1935, 1936, 1937, 1937, 1938, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1932, 1933, 1934, 1935, 1935, 1936, 1937, 1937, 1923, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1918, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1941,
+#> 1942, 1943, 1944, 1944, 1945, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1923, 1924, 1925, 1926, 1927, 1928, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1941, 1941, 1942, 1944, 1944, 1945, 1926, 1927, 1927, 1928, 1929, 1930, 1930, 1931, 1932, 1933, 1934, 1934, 1935, 1936, 1922, 1928, 1929, 1930, 1931, 1923, 1924, 1925, 1926, 1927, 1927,
+#> 1928, 1929, 1930, 1930, 1931, 1932, 1933, 1934, 1935, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1937, 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1930, 1931, 1932, 1932, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1921, 1922, 1923, 1924, 1925, 1927, 1928, 1929, 1930, 1931, 1931, 1932, 1933, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1942,
+#> 1918, 1919, 1920, 1921, 1922, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1935, 1936, 1936, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1937, 1938, 1938, 1939, 1940, 1941, 1927, 1928, 1929, 1930, 1931, 1932, 1932, 1933, 1934, 1934, 1935, 1936,
+#> 1938, 1939, 1939, 1940, 1946, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1942, 1943, 1919, 1920, 1922, 1923, 1928, 1929, 1930, 1931, 1932, 1933, 1933, 1934, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1942, 1942, 1944, 1945, 1929, 1930, 1931, 1932,
+#> 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1939, 1940, 1941, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1942, 1943, 1944, 1945, 1925, 1926, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1936, 1937, 1938, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1935, 1936, 1937, 1923, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1931,
+#> 1932, 1933, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1942, 1943, 1944, 1945, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1937, 1938, 1939, 1940, 1941, 1942, 1943, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1936, 1937, 1938, 1939, 1939, 1940, 1941, 1942, 1943, 1944, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1942, 1943, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1942, 1942, 1943, 1945,
+#> 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1941, 1942, 1943, 1946, 1946, 1947, 1924, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1933, 1934, 1934, 1935, 1936, 1937, 1930, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1947, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1941, 1942, 1943, 1946, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1942, 1943, 1946, 1930, 1933, 1934, 1935, 1936,
+#> 1937, 1938, 1939, 1940, 1941, 1942, 1943, 1944, 1946, 1946, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1938, 1939, 1940, 1941, 1942, 1923, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1942, 1943, 1945, 1946, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1937, 1938, 1938, 1939, 1940, 1940, 1928, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938,
+#> 1939, 1940, 1940, 1941, 1942, 1943, 1944, 1945, 1946, 1947, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1940, 1941, 1942, 1943, 1943, 1944, 1945, 1945, 1946, 1947, 1948, 1927, 1928, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1937, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1942, 1943, 1947, 1948, 1930, 1933, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1942, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1942, 1942, 1943, 1946, 1947, 1948,
+#> 1949, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1942, 1943, 1944, 1945, 1946, 1947, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1942, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1942, 1943, 1944, 1945, 1946, 1947, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1942, 1946, 1930, 1933, 1934, 1935, 1936, 1937,
+#> 1938, 1939, 1940, 1941, 1945, 1946, 1947, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1942, 1943, 1944, 1945, 1946, 1947, 1948, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1944, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1942, 1943, 1944, 1945, 1928, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1944, 1931, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1936, 1937, 1938, 1939, 1940, 1941, 1942, 1946, 1947,
+#> 1948, 1949, 1950, 1951, 1934, 1935, 1936, 1937, 1938, 1939, 1939, 1940, 1941, 1941, 1942, 1943, 1944, 1944, 1945, 1945, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1941, 1942, 1943, 1943, 1944, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1942, 1943, 1944, 1945, 1946, 1946, 1947, 1948, 1949, 1950, 1951, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1942, 1943, 1945, 1946, 1947, 1948, 1949, 1950, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1942,
+#> 1943, 1944, 1945, 1946, 1947, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1939, 1940, 1929, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1941, 1942, 1926, 1927, 1928, 1929, 1930, 1931, 1932, 1932, 1933, 1934, 1935, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1943, 1930, 1931, 1933, 1935, 1936, 1937, 1938, 1939, 1939, 1940, 1928, 1929, 1930, 1931, 1932, 1933, 1933, 1934, 1935, 1936, 1936, 1937, 1938, 1939, 1937, 1938, 1939, 1940, 1940, 1945, 1936, 1937, 1938,
+#> 1939, 1940, 1941, 1942, 1946, 1947, 1948, 1949, 1949, 1950, 1951, 1952, 1953, 1932, 1933, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1941, 1942, 1943, 1944, 1937, 1938, 1939, 1940, 1941, 1942, 1942, 1943, 1944, 1945, 1931, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1942, 1924, 1925, 1926, 1927, 1928, 1929, 1930, 1930, 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1942, 1945, 1946, 1947, 1928, 1929, 1930, 1931, 1931, 1932, 1933, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940,
+#> 1941, 1942, 1942, 1943, 1944, 1946, 1947, 1936, 1937, 1938, 1939, 1940, 1941, 1942, 1943, 1944, 1945, 1946, 1946, 1947, 1948, 1949, 1929, 1930, 1932, 1934, 1935, 1935, 1936, 1937, 1937, 1938, 1939, 1939, 1940, 1941, 1942, 1942, 1943, 1943, 1943, 1944, 1945, 1946, 1946, 1947, 1947, 1948, 1952, 1952, 1953, 1937, 1938, 1939, 1940, 1941, 1942, 1943, 1946, 1947, 1948, 1949, 1950, 1951, 1934, 1937, 1938, 1939, 1940, 1941, 1942, 1943, 1944, 1945, 1946, 1947, 1947, 1948, 1931, 1932, 1933, 1934, 1935, 1936,
+#> 1937, 1938, 1939, 1940, 1941, 1942, 1943, 1944, 1945, 1946, 1947, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1942, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1942, 1943, 1943, 1944, 1945, 1945, 1946, 1947, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1942, 1943, 1944, 1938, 1939, 1940, 1941, 1942, 1943, 1946, 1947, 1948, 1949, 1950, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1942, 1943, 1944, 1945, 1936, 1937, 1938, 1939, 1940, 1941, 1945, 1946, 1947, 1948, 1949, 1950, 1951,
+#> 1952, 1953, 1954, 1955, 1956, 1933, 1934, 1935, 1936, 1938, 1939, 1940, 1941, 1942, 1943, 1944, 1945, 1946, 1947, 1948, 1949, 1950, 1951, 1952, 1953, 1939, 1940, 1941, 1942, 1946, 1947, 1948, 1949, 1950, 1951, 1952, 1953, 1954, 1955, 1956, 1957, 1958, 1959, 1960, 1931, 1932, 1933, 1934, 1934, 1935, 1936, 1937, 1938, 1938, 1939, 1940, 1941, 1942, 1943, 1944, 1945, 1946, 1947, 1948, 1950, 1934, 1935, 1936, 1936, 1937, 1938, 1939, 1940, 1940, 1941, 1942, 1943, 1944, 1945, 1946, 1933, 1934, 1935, 1936,
+#> 1937, 1938, 1939, 1940, 1941, 1942, 1943, 1946, 1947, 1947, 1948, 1948, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1946, 1947, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1942, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1942, 1943, 1943, 1944, 1945, 1933, 1934, 1936, 1937, 1938, 1939, 1940, 1941, 1942, 1942, 1943, 1944, 1945, 1945, 1946, 1946, 1947, 1939, 1940, 1941, 1942, 1943, 1945, 1946, 1947, 1948, 1949, 1950, 1951, 1952, 1936, 1939, 1940, 1941, 1942, 1943, 1944, 1945, 1946,
+#> 1947, 1948, 1949, 1950, 1951, 1952, 1953, 1936, 1937, 1939, 1940, 1941, 1942, 1943, 1944, 1945, 1946, 1947, 1948, 1949, 1950, 1938, 1939, 1940, 1941, 1942, 1943, 1944, 1946, 1947, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1942, 1943, 1944, 1945, 1946, 1947, 1948, 1941, 1942, 1943, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1945, 1946, 1947, 1933, 1934, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1942, 1943, 1945, 1937, 1938, 1939, 1940, 1941, 1942, 1943, 1946, 1929, 1930,
+#> 1931, 1932, 1933, 1933, 1934, 1935, 1936, 1937, 1939, 1940, 1941, 1942, 1943, 1944, 1945, 1940, 1941, 1942, 1943, 1946, 1947, 1948, 1939, 1940, 1941, 1942, 1943, 1944, 1945, 1947, 1948, 1949, 1938, 1939, 1940, 1941, 1942, 1940, 1941, 1942, 1946, 1947, 1948, 1949, 1950, 1951, 1952, 1937, 1938, 1939, 1939, 1940, 1941, 1942, 1943, 1946, 1947, 1947, 1948, 1949, 1949, 1950, 1938, 1939, 1940, 1941, 1942, 1946, 1947, 1948, 1949, 1950, 1951, 1952, 1953, 1954, 1955, 1955, 1956, 1956, 1957, 1958, 1959, 1959,
+#> 1931, 1932, 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1942, 1943, 1944, 1945, 1946, 1947, 1936, 1937, 1938, 1939, 1940, 1941, 1942, 1937, 1938, 1939, 1940, 1941, 1942, 1943, 1944, 1946, 1947, 1948, 1949, 1950, 1941, 1942, 1943, 1944, 1946, 1947, 1948, 1949, 1940, 1941, 1942, 1943, 1944, 1945, 1946, 1947, 1948, 1949, 1938, 1939, 1940, 1941, 1942, 1943, 1944, 1945, 1946, 1947, 1940, 1941, 1942, 1945, 1946, 1947, 1948, 1949, 1950, 1937, 1938, 1939, 1940, 1941, 1942, 1943, 1944, 1945, 1946,
+#> 1947, 1940, 1941, 1942, 1943, 1944, 1946, 1947, 1948, 1949, 1949, 1941, 1942, 1943, 1944, 1945, 1946, 1947, 1948, 1949, 1950, 1951, 1952, 1953, 1953, 1954, 1955, 1955, 1938, 1939, 1940, 1941, 1942, 1943, 1944, 1945, 1945, 1946, 1947, 1947, 1949, 1941, 1942, 1946, 1947, 1948, 1941, 1942, 1946, 1947, 1948, 1949, 1940, 1941, 1942, 1943, 1944, 1945, 1946, 1947, 1948, 1949, 1950, 1952, 1953, 1937, 1938, 1939, 1940, 1941, 1942, 1943, 1944, 1945, 1949, 1950, 1951, 1954, 1942, 1946, 1947, 1948, 1949, 1950,
+#> 1951, 1952, 1952, 1953, 1954, 1954, 1934, 1937, 1938, 1939, 1940, 1941, 1942, 1943, 1944, 1945, 1946, 1947, 1947, 1948, 1943, 1946, 1947, 1948, 1949, 1950, 1951, 1951, 1952, 1953, 1939, 1940, 1941, 1942, 1943, 1944, 1945, 1946, 1947, 1948, 1949, 1950, 1951, 1952, 1952, 1957, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1942, 1943, 1944, 1945, 1941, 1943, 1944, 1946, 1947, 1948, 1949, 1950, 1952, 1941, 1942, 1943, 1944, 1946, 1947, 1948, 1949, 1950, 1951, 1952, 1953, 1954, 1955, 1956, 1957, 1958,
+#> 1959, 1960, 1961, 1962, 1963, 1932, 1938, 1939, 1940, 1941, 1942, 1943, 1944, 1945, 1946, 1947, 1948, 1949, 1940, 1941, 1942, 1943, 1944, 1945, 1946, 1947, 1948, 1949, 1949, 1950, 1950, 1951, 1952, 1953, 1954, 1954, 1955, 1956, 1957, 1937, 1938, 1939, 1940, 1940, 1941, 1942, 1943, 1944, 1945, 1946, 1946, 1943, 1944, 1945, 1946, 1947, 1948, 1949, 1950, 1950, 1951, 1952, 1939, 1940, 1941, 1942, 1943, 1944, 1945, 1946, 1947, 1948, 1949, 1950, 1951, 1952, 1953, 1954, 1955, 1939, 1940, 1941, 1942, 1943,
+#> 1944, 1945, 1946, 1947, 1948, 1949, 1950, 1951, 1952, 1953, 1953, 1942, 1943, 1944, 1945, 1946, 1948, 1949, 1944, 1945, 1946, 1946, 1947, 1948, 1948, 1949, 1950, 1950, 1942, 1943, 1944, 1945, 1946, 1947, 1947, 1948, 1949, 1950, 1937, 1938, 1939, 1940, 1941, 1942, 1943, 1944, 1946, 1947, 1948, 1949, 1950, 1951, 1931, 1933, 1934, 1935, 1936, 1936, 1937, 1938, 1939, 1939, 1940, 1941, 1942, 1943, 1944, 1945, 1946, 1947, 1948, 1949, 1938, 1939, 1941, 1942, 1943, 1944, 1945, 1946, 1947, 1930, 1931, 1932,
+#> 1933, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1940, 1942, 1943, 1943, 1944, 1945, 1932, 1933, 1934, 1935, 1935, 1943, 1944, 1945, 1946, 1945, 1946, 1947, 1948, 1949, 1950, 1941, 1942, 1943, 1944, 1945, 1946, 1947, 1948, 1949, 1950, 1951, 1952, 1953, 1953, 1954, 1955, 1956, 1957, 1941, 1942, 1943, 1944, 1945, 1946, 1947, 1947, 1938, 1939, 1940, 1940, 1941, 1942, 1942, 1942, 1943, 1944, 1945, 1945, 1946, 1947, 1934, 1935, 1936, 1937, 1938, 1939, 1940, 1941, 1942, 1943, 1944, 1945, 1946, 1947, 1948,
+#> 1949, 1950, 1951, 1952, 1953, 1954, 1955, 1941, 1942, 1943, 1944, 1945, 1946, 1947, 1948, 1949, 1943, 1944, 1945, 1946, 1947, 1948, 1949, 1950, 1951, 1951, 1952, 1953, 1954, 1955, 1956, 1957, 1958, 1959, 1940, 1943, 1944, 1945, 1946, 1947, 1948, 1949, 1950, 1951, 1952, 1953, 1942, 1943, 1944, 1945, 1945, 1946, 1947, 1948, 1949, 1950, 1950, 1950, 1951, 1942, 1943, 1944, 1945, 1946, 1947, 1948, 1949, 1950, 1951, 1952, 1937, 1938, 1939, 1940, 1943, 1944, 1945, 1945, 1946, 1947, 1948, 1949, 1942, 1943,
+#> 1944, 1945, 1946, 1947, 1950, 1951, 1951, 1937, 1938, 1939, 1944, 1945, 1946, 1946, 1936, 1937, 1938, 1943, 1944, 1945, 1946, 1947, 1948, 1939, 1940, 1941, 1942, 1943, 1946, 1947, 1948, 1949, 1950, 1950, 1951, 1952, 1953, 1954, 1955, 1956, 1957, 1958, 1959, 1960, 1943, 1944, 1945, 1946, 1946, 1947, 1948, 1949, 1950, 1951, 1952, 1952, 1953, 1954, 1954, 1955, 1956, 1956, 1957, 1943, 1945, 1946, 1947, 1948, 1949, 1950, 1951, 1951, 1938, 1939, 1940, 1941, 1942, 1943, 1944, 1945, 1946, 1947, 1948, 1949,
+#> 1950, 1951, 1952, 1941, 1942, 1943, 1946, 1947, 1948, 1949, 1950, 1951, 1951, 1952, 1953, 1953, 1954, 1955, 1956, 1956, 1943, 1944, 1944, 1945, 1946, 1947, 1948, 1949, 1950, 1951, 1952, 1953, 1940, 1941, 1942, 1943, 1946, 1947, 1948, 1949, 1950, 1951, 1952, 1953, 1954, 1955, 1956, 1946, 1947, 1948, 1949, 1950, 1951, 1952, 1953, 1954, 1955, 1956, 1957, 1958, 1959, 1959, 1942, 1946, 1947, 1948, 1949, 1950, 1951, 1951, 1952, 1953, 1954, 1955, 1955, 1940, 1941, 1942, 1946, 1947, 1948, 1949, 1950, 1951,
+#> 1952, 1953, 1954, 1955, 1956, 1957, 1958, 1940, 1941, 1942, 1946, 1947, 1948, 1949, 1950, 1951, 1952, 1953, 1936, 1938, 1939, 1940, 1941, 1942, 1943, 1944, 1945, 1946, 1947, 1948, 1946, 1947, 1948, 1949, 1950, 1951, 1952, 1953, 1954, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1965, 1942, 1943, 1944, 1945, 1946, 1947, 1948, 1949, 1950, 1951, 1952, 1953, 1954, 1937, 1938, 1939, 1940, 1941, 1942, 1946, 1947, 1948, 1949, 1950, 1946, 1947, 1948, 1949, 1950, 1951, 1951, 1952, 1954, 1955, 1956,
+#> 1942, 1946, 1947, 1948, 1949, 1950, 1951, 1952, 1952, 1953, 1955, 1946, 1947, 1948, 1949, 1950, 1951, 1952, 1953, 1953, 1954, 1955, 1944, 1945, 1946, 1947, 1948, 1949, 1950, 1951, 1952, 1953, 1953, 1954, 1954, 1956, 1942, 1946, 1947, 1948, 1949, 1950, 1951, 1952, 1953, 1954, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1965, 1942, 1946, 1947, 1948, 1949, 1950, 1951, 1952, 1952, 1953, 1954, 1955, 1947, 1948, 1949, 1950, 1951, 1952, 1953, 1954, 1955, 1956, 1947, 1948, 1949, 1950,
+#> 1951, 1952, 1953, 1954, 1955, 1955, 1936, 1937, 1938, 1939, 1940, 1941, 1942, 1946, 1947, 1947, 1948, 1949, 1950, 1951, 1952, 1941, 1942, 1946, 1947, 1948, 1949, 1950, 1951, 1952, 1953, 1954, 1955, 1956, 1957, 1958, 1946, 1947, 1948, 1949, 1950, 1951, 1952, 1953, 1954, 1955, 1955, 1939, 1940, 1941, 1942, 1943, 1944, 1945, 1946, 1947, 1948, 1949, 1949, 1950, 1951, 1952, 1941, 1942, 1946, 1947, 1948, 1949, 1950, 1951, 1951, 1952, 1952, 1952, 1953, 1953, 1954, 1955, 1956, 1956, 1946, 1948, 1949, 1950,
+#> 1951, 1952, 1953, 1954, 1955, 1956, 1956, 1957, 1958, 1958, 1959, 1960, 1960, 1944, 1945, 1946, 1947, 1948, 1949, 1950, 1954, 1943, 1944, 1945, 1946, 1947, 1948, 1949, 1950, 1950, 1951, 1952, 1952, 1952, 1953, 1954, 1947, 1948, 1949, 1950, 1951, 1952, 1953, 1954, 1955, 1956, 1947, 1948, 1949, 1950, 1951, 1952, 1952, 1953, 1954, 1954, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1961, 1962, 1963, 1963, 1943, 1947, 1948, 1949, 1950, 1951, 1952, 1953, 1954, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962,
+#> 1963, 1941, 1942, 1943, 1946, 1947, 1948, 1949, 1950, 1951, 1952, 1953, 1954, 1955, 1955, 1948, 1949, 1950, 1951, 1952, 1953, 1954, 1955, 1956, 1957, 1949, 1950, 1951, 1954, 1955, 1956, 1957, 1958, 1958, 1959, 1960, 1960, 1949, 1950, 1951, 1952, 1953, 1954, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1964, 1965, 1946, 1947, 1948, 1949, 1950, 1951, 1952, 1953, 1954, 1955, 1956, 1956, 1957, 1941, 1942, 1946, 1947, 1948, 1949, 1950, 1951, 1952, 1953, 1954, 1955, 1956, 1949, 1950, 1951,
+#> 1952, 1953, 1954, 1955, 1956, 1957, 1949, 1950, 1951, 1952, 1952, 1953, 1954, 1955, 1956, 1957, 1958, 1958, 1959, 1959, 1960, 1961, 1945, 1946, 1947, 1948, 1949, 1950, 1952, 1953, 1953, 1954, 1955, 1956, 1957, 1957, 1944, 1946, 1948, 1949, 1950, 1951, 1952, 1953, 1954, 1954, 1955, 1956, 1956, 1946, 1947, 1948, 1949, 1950, 1951, 1952, 1953, 1954, 1955, 1956, 1957, 1958, 1959, 1960, 1947, 1948, 1949, 1950, 1951, 1952, 1953, 1954, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1947, 1948,
+#> 1949, 1950, 1951, 1952, 1953, 1954, 1956, 1944, 1945, 1946, 1947, 1948, 1949, 1950, 1951, 1952, 1953, 1954, 1955, 1956, 1957, 1958, 1959, 1959, 1962, 1950, 1951, 1952, 1954, 1947, 1948, 1949, 1950, 1951, 1952, 1953, 1954, 1955, 1956, 1957, 1958, 1959, 1959, 1951, 1952, 1953, 1954, 1955, 1956, 1957, 1958, 1959, 1960, 1951, 1952, 1954, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1972, 1973, 1945, 1950, 1951, 1952, 1953, 1954, 1955, 1955,
+#> 1956, 1956, 1957, 1957, 1958, 1958, 1938, 1944, 1945, 1946, 1947, 1948, 1949, 1950, 1951, 1952, 1953, 1954, 1949, 1950, 1951, 1952, 1953, 1954, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1962, 1963, 1964, 1964, 1964, 1941, 1942, 1945, 1948, 1949, 1949, 1950, 1951, 1952, 1953, 1954, 1955, 1956, 1957, 1958, 1959, 1950, 1952, 1953, 1954, 1955, 1955, 1956, 1957, 1952, 1953, 1954, 1955, 1955, 1956, 1957, 1951, 1952, 1953, 1954, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966,
+#> 1967, 1968, 1948, 1949, 1950, 1951, 1952, 1953, 1954, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1965, 1966, 1966, 1949, 1950, 1951, 1952, 1953, 1954, 1950, 1951, 1952, 1953, 1955, 1956, 1957, 1957, 1958, 1959, 1960, 1961, 1961, 1947, 1948, 1949, 1950, 1951, 1952, 1953, 1954, 1955, 1956, 1952, 1953, 1954, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1965, 1966, 1966, 1953, 1954, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1945,
+#> 1946, 1947, 1948, 1949, 1950, 1951, 1952, 1953, 1954, 1955, 1956, 1956, 1957, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1948, 1949, 1950, 1951, 1951, 1952, 1953, 1954, 1955, 1956, 1957, 1958, 1958, 1959, 1959, 1959, 1952, 1953, 1954, 1955, 1956, 1957, 1959, 1954, 1955, 1956, 1957, 1958, 1958, 1959, 1960, 1960, 1960, 1962, 1954, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1947, 1948, 1949, 1950, 1951, 1952, 1953, 1954, 1955, 1956, 1957, 1958, 1959, 1959, 1960, 1961, 1949, 1950,
+#> 1951, 1952, 1953, 1954, 1955, 1956, 1957, 1958, 1959, 1959, 1959, 1948, 1949, 1950, 1953, 1954, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1961, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 1999, 1953, 1954, 1955, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1966, 1967, 1969, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1955, 1956, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1968, 1947, 1948, 1949, 1950, 1951, 1952, 1953, 1954, 1955, 1956, 1957, 1958, 1959, 1960,
+#> 1961, 1962, 1963, 1964, 1965, 1952, 1953, 1954, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1967, 1968, 1953, 1954, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1950, 1953, 1954, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1953, 1954, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1953, 1954, 1955, 1956,
+#> 1957, 1958, 1959, 1960, 1961, 1961, 1962, 1963, 1964, 1964, 1965, 1965, 1967, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1974, 1975, 1976, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1967, 1968, 1968, 1969, 1954, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967,
+#> 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1945, 1948, 1949, 1950, 1951, 1952, 1953, 1954, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1950, 1951, 1952, 1953, 1954, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1963, 1964, 1964, 1965, 1965, 1966, 1967, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1946, 1947, 1948, 1949, 1950, 1951, 1952, 1953, 1954, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1949, 1951, 1951, 1952, 1953, 1954,
+#> 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1976, 1980, 1951, 1952, 1953, 1954, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1964, 1965, 1966, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1965, 1966, 1967, 1967, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1969, 1970, 1971, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1967,
+#> 1968, 1951, 1953, 1954, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1963, 1954, 1955, 1956, 1957, 1958, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1964, 1964, 1965, 1954, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1950, 1952, 1953, 1954, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1963, 1963, 1964, 1965, 1966, 1967, 1956, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1967, 1968, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966,
+#> 1967, 1968, 1969, 1970, 1971, 1972, 1949, 1950, 1953, 1954, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1952, 1953, 1954, 1955, 1956, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1950, 1951, 1952, 1952, 1953, 1954, 1955, 1956, 1957, 1958, 1959, 1961, 1958, 1959, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1972, 1973, 1974, 1951, 1952, 1953, 1954, 1955, 1956,
+#> 1957, 1958, 1959, 1960, 1961, 1961, 1962, 1963, 1964, 1964, 1965, 1965, 1965, 1966, 1951, 1952, 1953, 1954, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1966, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1967, 1968, 1939, 1941, 1942, 1943, 1944, 1946, 1947, 1948, 1949, 1950, 1951, 1952, 1953, 1954, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1963, 1956, 1956, 1958, 1959, 1960, 1961, 1962, 1963, 1964,
+#> 1965, 1966, 1967, 1967, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1976, 1977, 1978, 1979, 1980, 1951, 1952, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1950, 1951, 1954, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970,
+#> 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1967, 1967, 1957, 1958, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1956, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1952, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1967, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967,
+#> 1968, 1968, 1969, 1970, 1971, 1972, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1972, 1973, 1954, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1964, 1965, 1966, 1967, 1967, 1959, 1960, 1961, 1962, 1963, 1964, 1964, 1965, 1966, 1952, 1953, 1954, 1955, 1956, 1956, 1957, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1963, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1968, 1969, 1970, 1971, 1972, 1973, 1974,
+#> 1975, 1960, 1961, 1962, 1963, 1964, 1966, 1967, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1954, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1964, 1964, 1965, 1965, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974,
+#> 1975, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1969, 1970, 1971, 1972, 1961, 1962, 1963, 1964, 1965, 1966, 1966, 1967, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1967, 1968, 1968, 1949, 1951, 1952, 1953, 1954, 1955, 1955, 1956, 1957,
+#> 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1964, 1965, 1966, 1967, 1953, 1954, 1955, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1966, 1955, 1956, 1957, 1959, 1960, 1961, 1962, 1963, 1952, 1953, 1954, 1956, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1968, 1969, 1956, 1957, 1957, 1958, 1959, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1966, 1967, 1956, 1957, 1958, 1959, 1960, 1961,
+#> 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1979, 1980, 1980, 1981, 1982, 1983, 1961, 1962, 1963, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1969, 1950, 1951, 1952, 1954, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1959, 1960, 1961, 1962, 1963, 1964, 1965,
+#> 1966, 1967, 1968, 1969, 1969, 1970, 1970, 1970, 1971, 1972, 1972, 1973, 1974, 1975, 1976, 1976, 1954, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1962, 1963, 1964, 1965, 1966, 1966, 1967, 1967, 1969, 1969, 1953, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1968, 1969, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976,
+#> 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1969, 1971, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1971, 1960, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971,
+#> 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1984, 1985, 1986, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1970, 1971, 1972, 1973, 1973, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1961, 1962, 1963, 1964, 1965,
+#> 1966, 1967, 1968, 1969, 1970, 1970, 1971, 1963, 1964, 1965, 1966, 1967, 1968, 1968, 1969, 1969, 1970, 1971, 1972, 1973, 1973, 1974, 1977, 1978, 1979, 1980, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1958, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1958, 1959,
+#> 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1966, 1969, 1954, 1955, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1973, 1974, 1975, 1976, 1977, 1977, 1978, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1974, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1961, 1962,
+#> 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1969, 1970, 1970, 1961, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1971, 1972, 1972, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1963, 1964, 1965, 1966, 1967, 1968, 1968, 1969, 1969, 1969, 1970, 1970, 1958, 1959, 1960, 1961,
+#> 1962, 1963, 1964, 1964, 1965, 1966, 1967, 1968, 1969, 1969, 1970, 1970, 1971, 1971, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1960, 1961, 1961, 1962, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1973, 1974, 1974, 1974, 1975, 1975, 1976, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1972, 1973,
+#> 1973, 1955, 1956, 1957, 1960, 1963, 1964, 1965, 1966, 1966, 1967, 1968, 1969, 1970, 1970, 1970, 1971, 1972, 1964, 1965, 1966, 1967, 1968, 1969, 1969, 1970, 1971, 1972, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1973, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1977, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977,
+#> 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1959, 1960, 1962, 1963, 1964, 1965, 1966, 1966, 1967, 1968, 1969, 1970, 1970, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1971, 1972, 1973, 1973, 1974, 1964, 1965, 1966, 1967, 1968, 1969, 1969, 1970, 1971, 1972, 1972, 1973, 1974, 1974, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1968, 1969, 1970, 1971, 1972, 1972, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976,
+#> 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1961, 1962, 1963, 1964, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1956, 1957, 1958, 1959, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1970, 1971, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1979, 1979, 1964, 1965, 1966, 1967, 1968, 1969,
+#> 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1979, 1980, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1986, 1959, 1960, 1961, 1963, 1964, 1965, 1966, 1967,
+#> 1968, 1969, 1970, 1971, 1972, 1972, 1973, 1974, 1974, 1975, 1975, 1976, 1977, 1978, 1979, 1980, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1977, 1965, 1966, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1966, 1967, 1968, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1978, 1979, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1972, 1966, 1967,
+#> 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1972, 1973, 1973, 1974, 1974, 1975, 1966, 1968, 1969, 1970, 1971, 1972, 1973, 1974,
+#> 1975, 1975, 1976, 1977, 1977, 1978, 1979, 1980, 1981, 1982, 1982, 1963, 1964, 1965, 1966, 1966, 1967, 1967, 1967, 1968, 1969, 1969, 1970, 1971, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1977, 1978, 1978, 1978, 1979, 1980, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1977, 1978, 1979, 1961, 1962, 1963, 1964, 1964, 1965, 1967, 1968,
+#> 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1959, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1977, 1978, 1978, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1955, 1956, 1957, 1959, 1960,
+#> 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1964, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1979, 1980, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1963, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972,
+#> 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1986, 1986, 1987, 1987, 1988, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1972, 1973, 1973, 1974, 1963, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1971, 1972, 1972, 1973, 1968, 1969, 1970, 1971, 1972, 1973, 1973, 1974, 1975, 1976, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1969,
+#> 1970, 1971, 1972, 1959, 1960, 1961, 1962, 1963, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1975, 1968, 1969, 1970, 1971, 1972, 1973, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1981, 1982, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1977, 1979, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1977, 1964, 1965, 1966, 1967, 1969, 1970,
+#> 1971, 1975, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1973, 1974, 1975, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1965, 1966, 1967, 1968, 1969, 1970, 1972, 1973, 1974, 1975, 1976, 1977, 1977, 1979, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1985, 1986, 1967, 1969, 1970, 1971, 1972,
+#> 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1978, 1979, 1980, 1981, 1960, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1975, 1976, 1979, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1971, 1972, 1973, 1974, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1988, 1970, 1971, 1972, 1973,
+#> 1974, 1975, 1976, 1976, 1977, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1965, 1966, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1979, 1980, 1981, 1982, 1983, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1965, 1966, 1967, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976,
+#> 1977, 1978, 1979, 1980, 1981, 1982, 1967, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1964, 1966, 1966, 1968, 1970, 1971, 1972, 1973, 1973, 1974, 1974, 1975, 1976, 1976, 1962, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1977, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981,
+#> 1982, 1983, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1975, 1976, 1977, 1978, 1979, 1980, 1980, 1981, 1982, 1983, 1983, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1969, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1961, 1962, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1975, 1975, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977,
+#> 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1985, 1986, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1985, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1965, 1967, 1968, 1969, 1971, 1972, 1973, 1973, 1974, 1974, 1974, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1984, 1984,
+#> 1985, 1986, 1987, 1988, 1989, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1980, 1981, 1982, 1982, 1964, 1965, 1966, 1967, 1968, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1977, 1978, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1979, 1980, 1981, 1983, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1968, 1970, 1971, 1972, 1973, 1974, 1975,
+#> 1976, 1977, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1983, 1984, 1984, 1985, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1978, 1979, 1980, 1965, 1966, 1967, 1968, 1969, 1970, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1987, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980,
+#> 1981, 1982, 1982, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1976, 1977, 1978, 1978, 1979, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1967, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986,
+#> 1967, 1969, 1970, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1976, 1977, 1977, 1978, 1979, 1980, 1981, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1968, 1969, 1970, 1971, 1972, 1973,
+#> 1974, 1975, 1976, 1977, 1978, 1979, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1976, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1974, 1975, 1976, 1977, 1978, 1979, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1973, 1974, 1975, 1976, 1977, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981,
+#> 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1984, 1985, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1985, 1986, 1987, 1987, 1964, 1965, 1966,
+#> 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1988, 1989, 1990, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1972, 1973, 1974, 1975, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1975, 1976, 1977, 1977, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1983, 1984,
+#> 1985, 1986, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1969, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1968, 1969,
+#> 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1984, 1985, 1985, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1991, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1989, 1991, 1992, 1993, 1994, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1969, 1970, 1971, 1971, 1972, 1973, 1974, 1975, 1976, 1977,
+#> 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1986, 1967, 1968, 1969, 1970, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1980, 1981, 1982, 1983, 1983, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1988, 1989, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1983, 1984, 1985, 1986, 1987, 1963, 1964, 1965,
+#> 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1982, 1983, 1984, 1985, 1985, 1986, 1987, 1988, 1989, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1982, 1983, 1984, 1985, 1985, 1986, 1987, 1988, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1974, 1975, 1976, 1977, 1977, 1978, 1978, 1979, 1980, 1981, 1976, 1977, 1978, 1979, 1980, 1974, 1975, 1976, 1977,
+#> 1977, 1978, 1976, 1977, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1968, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1993, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977,
+#> 1978, 1979, 1979, 1980, 1981, 1982, 1983, 1984, 1966, 1970, 1971, 1972, 1973, 1974, 1975, 1975, 1976, 1976, 1977, 1978, 1979, 1979, 1980, 1980, 1981, 1981, 1982, 1982, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1986, 1987, 1988, 1988, 1989, 1990, 1990, 1991, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987,
+#> 1988, 1989, 1990, 1971, 1972, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1987, 1988, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1996, 1997, 1997, 1976, 1977, 1978, 1979, 1980, 1981, 1982,
+#> 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1990, 1991, 1992, 1968, 1969, 1970, 1971, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1966, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983,
+#> 1984, 1986, 1987, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1981, 1983, 1984, 1985, 1986, 1987, 1987, 1988, 1989, 1990, 1991, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1991, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1982, 1983, 1984, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983,
+#> 1984, 1985, 1986, 1987, 1988, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1984, 1985, 1986, 1986, 1987, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1981, 1982, 1983, 1985, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980,
+#> 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1987, 1987, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1988, 1963, 1964, 1965, 1966, 1967, 1968, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1975, 1976,
+#> 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1987, 1988, 1989, 1990, 1991, 1992, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1988, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1985, 1986, 1987, 1988, 1988, 1989,
+#> 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1983, 1984, 1985, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1990, 1990, 1991, 1992, 1993, 1994, 1995, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1987, 1988, 1973, 1974, 1975, 1976, 1976, 1977, 1978, 1979, 1981, 1982,
+#> 1983, 1984, 1985, 1986, 1987, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1982, 1983, 1984, 1984, 1985, 1986, 1979, 1980, 1981, 1982, 1983, 1984, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1976, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1970, 1971, 1972, 1973,
+#> 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1975, 1976, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1982, 1983, 1984, 1984, 1985, 1986, 1987, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1977, 1977, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1983, 1984, 1985, 1985, 1986, 1967, 1968, 1969, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1985, 1986, 1987, 1987,
+#> 1988, 1965, 1966, 1967, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1990, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988,
+#> 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1975, 1976, 1977, 1977, 1978, 1979, 1980, 1981, 1982, 1982, 1983, 1984, 1985, 1985, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1988, 1989, 1990, 1980, 1981, 1982, 1980, 1981, 1982, 1983, 1985, 1985, 1987, 1991,
+#> 1992, 1993, 1994, 1995, 1996, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1992, 1993, 1994, 1995, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1985, 1986, 1987, 1988, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1988, 1989, 1975, 1976, 1977, 1978, 1979, 1980,
+#> 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1972, 1973, 1973, 1974, 1975, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1983, 1984, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1987, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1993, 1994, 1995, 1996, 1997, 1997, 1975, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1979,
+#> 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1989, 1990, 1991, 1992, 1993, 1993, 1994, 1995, 1996, 1997, 1997, 1998, 1999, 2000, 2000, 2001, 2002, 2003, 1971, 1972, 1973, 1974, 1975, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1979, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1994, 1995, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983,
+#> 1984, 1985, 1986, 1987, 1988, 1989, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1988, 1989, 1990, 1991, 1992, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1985, 1986, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1990, 1991, 1992,
+#> 1993, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1988, 1989, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1987, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1988, 1989, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987,
+#> 1987, 1988, 1989, 1990, 1991, 1992, 1992, 1973, 1974, 1975, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1973, 1974, 1975, 1976, 1978, 1979, 1980, 1981, 1982, 1983, 1983, 1984, 1985, 1986, 1986, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1998, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1993, 1994, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985,
+#> 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1988, 1989, 1990, 1991, 1992, 1993, 1969, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1982, 1983, 1984, 1985, 1986, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1996, 1997, 1980, 1981, 1982, 1983, 1984, 1985,
+#> 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1997, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 1974, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1984, 1985, 1986, 1987, 1988, 1977, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1985, 1985, 1986, 1987, 1982, 1983, 1984, 1985, 1986, 1986, 1987, 1988, 1989, 1990, 1990, 1991, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996,
+#> 1997, 1998, 1999, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1987, 1988, 1989, 1990, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1970, 1971, 1972, 1973, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1979, 1980, 1981, 1982, 1983, 1984, 1985,
+#> 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1978, 1979, 1980, 1981, 1982, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1989, 1990, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2001, 2001, 2002, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1990, 1991, 1992, 1993, 1993, 1994, 1995, 1996, 1996, 1997, 1979, 1980, 1981, 1982,
+#> 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1976, 1977, 1978, 1979, 1980, 1981, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1996, 1997, 1998, 1999, 2000, 2000, 2000, 1982, 1983, 1984, 1985, 1986, 1987,
+#> 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1983, 1984, 1985, 1986, 1986, 1987, 1988, 1989, 1990, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1995, 1997, 1998, 1999, 2001, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1992, 1980, 1981,
+#> 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1996, 1979, 1980, 1981, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1992, 1993, 1994, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1998, 1999, 2000, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1995, 1996, 1997, 1981, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1980, 1981, 1982, 1983, 1984, 1985, 1986,
+#> 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1989, 1990, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1997, 1998, 1999, 1999, 2000, 2000, 2001, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1990, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1988, 1989, 1990, 1990, 1991, 1991, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1988, 1989, 1990, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1984,
+#> 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1993, 1994, 1995, 1996, 1997, 1998, 1998, 1999, 2000, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1989, 1990, 1991, 1992, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1983,
+#> 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1993, 1994, 1995, 1997, 1998, 1999, 2001, 2001, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1988, 1989, 1990, 1974, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1985, 1986, 1985, 1986, 1987, 1988, 1989, 1992, 1993, 1994, 1995, 1996, 1997, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2000, 2001, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1979, 1980, 1981,
+#> 1982, 1983, 1983, 1984, 1985, 1986, 1987, 1987, 1991, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1990, 1991, 1992, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1993, 1994, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1989, 1990, 1991, 1993, 1994, 1995, 1984, 1985, 1986, 1987, 1988, 1989, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 1984, 1985, 1986, 1987,
+#> 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1996, 1997, 1998, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1993, 1994, 1995, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1993, 1994, 1996, 1997, 1998, 1999, 2000, 2001, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1977, 1978, 1979, 1980, 1981, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1988, 1989, 1990, 1986, 1987, 1988, 1989,
+#> 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1997, 1998, 1999, 2000, 2001, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 1985, 1986, 1987, 1988, 1989, 1990, 1990, 1991, 1992, 1993, 1994, 1995, 1995, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1989, 1990, 1991, 1992, 1992, 1993, 1994, 1995, 1995, 1996, 1997, 1998, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1984, 1985, 1986, 1987,
+#> 1988, 1989, 1989, 1990, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1975, 1976, 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1985, 1986, 1987, 1988,
+#> 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1995, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2003, 2004, 2005, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1995,
+#> 1996, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1996, 1997, 1997, 1999, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2007, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 2000, 2001, 2001, 2002, 2003, 2004, 1986, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1995, 1996, 1997, 1998, 1998, 1999, 2000, 2001, 1981, 1983, 1984, 1985, 1986, 1987, 1988,
+#> 1989, 1989, 1990, 1991, 1992, 1992, 1993, 1994, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 1976, 1977, 1978, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1978, 1981, 1982, 1983, 1983, 1984, 1985, 1985, 1986, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2000, 1983, 1984, 1985, 1986, 1987, 1988, 1989,
+#> 1990, 1991, 1992, 1992, 1993, 1994, 1995, 1996, 1997, 1997, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1986, 1987, 1988, 1989, 1990, 1991, 1993, 1994, 1980, 1981, 1983, 1984, 1985, 1986, 1987, 1987, 1988, 1989, 1990, 1991, 1992, 1992, 1993, 1993, 1994, 1997, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1991, 1991, 1992, 1993, 1994, 1995, 1982, 1983, 1984, 1985, 1986, 1987, 1987, 1988, 1989, 1984, 1986, 1987, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1996,
+#> 1996, 1997, 1998, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1992, 1993, 1994, 1994, 1995, 1996, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1995, 1996, 1996, 1997, 1997, 1998, 1999, 2000, 2001, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2001, 2002, 2003, 2004, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1986, 1987, 1988,
+#> 1989, 1990, 1991, 1992, 1992, 1993, 1994, 1995, 1995, 1996, 1996, 1997, 1997, 1998, 2000, 2001, 2002, 2003, 2003, 2004, 2005, 2006, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2002, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994,
+#> 1995, 1996, 1997, 1997, 1998, 1998, 1999, 1999, 2000, 2001, 2002, 1984, 1985, 1986, 1987, 1988, 1989, 1989, 1990, 1991, 1992, 1992, 1993, 1994, 1994, 1995, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2002, 2003, 2004,
+#> 2005, 2006, 2006, 2007, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2008, 2009, 2010, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001,
+#> 2002, 2003, 2004, 2005, 2006, 2006, 2007, 2008, 2008, 1983, 1984, 1985, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1988, 1989, 1990, 1991, 1992, 1993, 1995, 1995, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1998, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1993, 1994, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2000, 2001, 2002, 1985, 1986, 1987, 1988, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1996, 1997, 1998,
+#> 1998, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 2001, 2002, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2003,
+#> 2004, 2004, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2003, 2004, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1981, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2003, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998,
+#> 1999, 2000, 2001, 2002, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2008, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1998, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1995, 1996, 1997, 1998, 1999, 2000, 2000, 2001, 2001, 2002, 2003, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1995, 1996, 1998,
+#> 1999, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2008, 2009, 2009, 2010, 2011, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1995, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2004, 2005, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2001, 2002, 2003, 2004,
+#> 2005, 2006, 2007, 2008, 2009, 2009, 1992, 1993, 1994, 1995, 1996, 1997, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 1988, 1989, 1990, 1991, 1992, 1993, 1993, 1994, 1995, 1996,
+#> 1997, 1998, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 1983, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1997, 1991, 1992, 1993, 1994, 1995, 1995, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1995, 1996, 1997, 1998, 1987, 1988, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 1982, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1996, 1997, 1998, 1998, 1999, 2000, 1988, 1989, 1990, 1991, 1992, 1993,
+#> 1994, 1995, 1995, 1996, 1996, 1996, 1997, 1998, 1999, 1999, 2001, 2002, 2003, 2004, 2004, 2005, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2002, 2003, 2003, 2004, 2005, 2006, 2007, 2007, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1996, 1997, 1998,
+#> 1999, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2004, 2005, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995,
+#> 1996, 1997, 1998, 1999, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2006, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1998, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1996, 1997, 1998, 1999, 1999, 2002, 2003, 2004, 2005, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1997, 1998, 1998, 1999, 2000, 2000, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 1985, 1986,
+#> 1987, 1988, 1989, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1992, 1993, 1994, 1995, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2003, 1990, 1991, 1992, 1993, 1994, 1995, 1995, 1996, 1997, 1997, 1998, 1999, 2000, 2001, 2002, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 1999, 2000, 2001, 2003, 2004, 1993, 1994, 1995, 1996, 1997, 1998, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2002, 2003, 2003, 2004, 2004, 2005, 1990, 1990, 1992,
+#> 1993, 1994, 1995, 1996, 1997, 1998, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1995, 1996, 1997, 1998, 1999, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2000, 2001, 2002, 2002, 2003, 2004, 2005, 1990, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2003, 2004, 2005, 2006, 2006, 2007, 2007, 1988, 1989, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1998, 1999, 2000, 2001, 2002,
+#> 2003, 2004, 2005, 2006, 2007, 2008, 2009, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2008, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2001, 1994, 1995, 1996, 1997, 1998, 1998, 1999, 2000, 2000, 2001, 2002, 2003, 2004, 2005, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2004, 2005, 2006, 2007, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2002,
+#> 2003, 1987, 1990, 1991, 1992, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2007, 1982, 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 1995, 1996, 1997, 1998, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2008, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2008, 2009, 2010, 2010, 2011, 1992, 1993, 1994, 1995,
+#> 1996, 1997, 1998, 1999, 2000, 2001, 2002, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2001, 2002, 2003, 2004, 2005, 2006, 2006, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2000, 2001, 1989, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2007, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2009, 2010, 2011, 2011, 2012, 2012,
+#> 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2008, 2010, 2010, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1998, 1999, 2000, 2001, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 1981, 1982,
+#> 1983, 1984, 1985, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1995, 1996, 1997, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 1987, 1988, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2006, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997,
+#> 1998, 1999, 2000, 2001, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 1995, 1996, 1997, 1998, 1999, 2000, 2000, 2001, 2002, 2002, 2003, 2004, 2005, 2005, 2006, 2006, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2015, 1992, 1993, 1994, 1995, 1996, 1997, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2003, 2004, 2005, 2006, 2006, 1995, 1996, 1997, 1998, 1999,
+#> 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2012, 2013, 1987, 1988, 1989, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2005, 1993, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998,
+#> 1999, 2000, 2001, 2002, 2003, 2004, 2005, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 1996, 1997, 1998, 1999, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2006, 2007, 2008, 2008, 2009, 2009, 2010, 2011, 2012, 2012, 1990, 1991, 1992, 1993, 1994, 1995, 1995, 1996, 1997, 1998, 1998, 1999, 2000, 2001, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2004, 2005, 2006, 2007, 2008, 2009, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2009, 2010,
+#> 2011, 2012, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 1991, 1992, 1993, 1994, 1995, 1996, 1996, 1997, 1998, 1999, 2000, 2000, 2001, 2002, 2003, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004,
+#> 2005, 2006, 2006, 2007, 2007, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2005, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2001, 2002, 2003, 2003, 2004, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2001, 2002, 2002, 2003, 2004, 2005, 2006, 2007, 2008,
+#> 2009, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2004, 2005, 1998, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2010, 2011, 2012, 1992, 1993, 1994, 1995, 1996, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 1989, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 1986, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995,
+#> 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 1998, 1999, 2000, 2001, 2002, 2004, 2005, 2006, 2006, 2007, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2006, 2007, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2006, 2007, 2008, 1993, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006,
+#> 2007, 2008, 2009, 2010, 2011, 2012, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2009, 2010, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2011, 2012, 2013, 2014, 2015, 1999, 2000, 2001, 2002, 2003, 2003, 2004, 2005, 2006, 2006, 2007, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 1995, 1996,
+#> 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2006, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2008, 2009, 2010, 1986, 1987, 1988, 1989, 1990, 1991, 1993, 1994, 1995, 1996, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2006, 2007, 2008, 2009, 2010, 2012, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2001, 2002, 2003, 2004, 2005, 2006,
+#> 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2001, 2002, 2003, 2003, 2004, 2005, 2005, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1998, 1999, 2000, 2002, 1996, 1997, 1998, 1999, 2000, 2001, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 1989, 1990, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 1994, 1995, 1996, 1997, 1998,
+#> 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 1996, 1997, 1998, 1999, 2000, 2001, 2001, 2002, 2003, 2004, 2004, 2005, 2006, 2006, 2007, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2009, 2010, 2011, 2012, 2013, 2014, 1992, 1992, 1993, 1994, 1995, 1996, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 1993, 1994, 1995, 1996,
+#> 1997, 1998, 1999, 2000, 2001, 2001, 2002, 2003, 2003, 2004, 2004, 2005, 2006, 2007, 2008, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2000, 2001, 2002, 2003, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2011, 2012, 2014, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005,
+#> 2006, 2007, 2008, 2009, 2010, 2011, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2004, 2005, 2006, 2007, 2008, 2009, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2011, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010,
+#> 2011, 2012, 2013, 2014, 2015, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2012, 2013, 2014, 2015, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 1993, 1994, 1995, 1996, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2004, 2005, 2006, 2007, 2008, 2009, 2009, 2010, 2011, 2011, 1995, 1997, 1997, 1998, 1999, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007,
+#> 2008, 2009, 2010, 2011, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2003, 2003, 2004, 2005, 2006, 2007, 2007, 2008, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 1990, 1991, 1992, 1993, 1994, 1995, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2004, 2005, 2006, 2007, 2008, 2009, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 1993, 1993,
+#> 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 1969, 1971, 1972, 1973, 1974, 1975, 1975, 1976, 1977, 1977, 1978, 1979, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2015, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2010, 1996, 1997, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2005, 2006, 1997, 1998, 1999, 2000, 2001, 2002, 2003,
+#> 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2010, 2011, 2013, 1999, 2000, 2001, 2002, 2003, 2004, 2004, 2002, 2003, 2004, 2005, 2006, 2006, 2007, 2008, 2009, 2009, 2010, 2011, 2012, 2013, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2013, 2014, 1994, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 1997, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005,
+#> 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2012, 2013, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2012, 2013, 2014, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2007, 2008, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2010, 2011, 2011, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2007, 2008, 2009, 2010,
+#> 1997, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2005, 2005, 2006, 2007, 2008, 1997, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2008, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2009, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2010, 2011, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2002, 2003, 2004, 2005, 2006, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006,
+#> 2007, 2008, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2008, 2009, 2010, 2011, 2012, 2012, 2014, 2015, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2012, 2001, 2002, 2003, 2004, 2005, 2006, 2006, 2007, 2007, 2008, 2009, 2010, 2011,
+#> 2012, 2012, 2013, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2010, 2003, 2003, 2004, 2005, 2006, 2007, 2008, 2008, 2009, 2010, 2011, 2012, 2013, 2003, 2004, 2005, 2006, 2007, 2007, 2008, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 1999, 2000, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2009, 2010, 2011, 2013, 2014, 2015, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009,
+#> 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2012, 2014, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2009, 2010, 2011, 2011, 2012, 1997, 1998, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 1998, 1999, 2000, 2001, 2002,
+#> 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 1995, 1996, 1996, 1997, 1998, 1999, 2000, 2001, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2009, 1999, 2000, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2011, 2012, 2013, 2014, 2015, 1997, 1998, 1999, 2000, 2001, 2002, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2011, 2012, 2013, 2014, 2015, 1997, 1998, 1999, 2000, 2001, 2002, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011,
+#> 2012, 2012, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2010, 2011, 2012, 2013, 2003, 2004, 2005, 2006, 2007, 2008, 2010, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2014, 2015, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2000, 2002, 2003, 2004, 2005, 2006, 2007, 2007, 2008, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2007, 2008, 2009,
+#> 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2012, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2011, 2012, 2012, 2013, 2015, 2001, 2002, 2003, 2004, 2005, 2006, 2006, 2007, 2008, 2008, 2009, 2009, 2010, 2010, 2011, 2011, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002,
+#> 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2013, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2004, 2005, 2006, 2007, 2008, 2008, 1998, 1999, 2000, 2001, 2002, 2002, 2003, 2004, 2005, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2008, 2009, 2010, 1954, 1955, 1956, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2014, 2015, 2015, 2003, 2004,
+#> 2005, 2006, 2007, 2008, 2009, 1995, 1996, 1997, 1998, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2010, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2013, 2014, 2015, 1995, 1996, 1997, 1998, 1998, 1999, 2000, 2001, 2002, 2003, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2010, 2012, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2011, 2012, 2013, 2013, 2014, 2015, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2005, 2006,
+#> 2007, 2008, 2009, 2010, 2011, 2012, 2012, 2013, 2014, 2015, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2015, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2004, 2005, 2006, 2007, 2008, 2009, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2001, 2002, 2003,
+#> 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2015, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2010, 2011, 2012, 2013, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2015, 2001, 2002, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2013, 2014, 1996, 1997, 1998, 1999, 2000,
+#> 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2009, 2010, 2011, 2012, 2013, 2013, 2014, 2014, 2015, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2012, 2013, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2014, 2014, 2015, 2015, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2005, 2006, 2007, 2008, 2009, 2009, 2010, 2010, 2011, 2012,
+#> 2013, 2013, 2014, 2015, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2010, 1991, 1992, 1993, 1994, 1995, 1996, 1997, 1997, 1998, 1999, 2000, 2000, 2001, 2002, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2003, 2004, 2005, 2006,
+#> 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2007, 2008, 2008, 2009, 2010, 2011, 2012, 1995, 1996, 1997, 1997, 1998, 2001, 2002, 2003, 2004, 2005, 2005, 2006, 2007, 2008, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2013, 2014, 2015, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2015, 2002, 2003,
+#> 2004, 2005, 2006, 2007, 2008, 2009, 2009, 2010, 2010, 2011, 2012, 2013, 2014, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2012, 2013, 2014, 2015, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2005, 2006, 2007, 2008, 2009, 2009, 2010, 2011, 2012, 2012, 2013, 2014,
+#> 2003, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2012, 2013, 2014, 2015, 2015, 1998, 1999, 2000, 2001, 2002, 2003, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2015, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2014, 2015, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2012, 2013, 2014, 2014, 2015, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2006, 2007, 2008, 2009, 2009, 2010, 2011, 2012, 2007, 2008, 2009,
+#> 2010, 2011, 2012, 2013, 2014, 2015, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2002, 2003, 2003, 2004, 2005, 2007, 2008, 2009, 2010, 2010, 2011, 2011, 2012, 2013, 2014, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2011, 2012, 2013, 2014, 2015, 2011, 2012, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2012, 2013, 2014, 2015, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2000, 2001, 2002,
+#> 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2006, 2007, 2008, 2009, 2010, 2011, 2011, 2012, 2013, 2014, 2015, 2015, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2005, 2006, 2007, 2008, 2009, 2010, 2012, 2013, 2014, 2015, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2011, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2009, 2010, 2011, 2012, 2013, 2015, 2009, 2010, 2011,
+#> 2012, 2013, 2014, 2015, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 1999, 2001, 2002, 2003, 2004, 2005, 2006, 2006, 2007, 2008, 2009, 2010, 2011, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2005, 2006, 2008, 2009, 2010, 2011, 2012, 2012, 2013, 2014, 2015, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013,
+#> 2014, 2015, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2015, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2015, 2004, 2004, 2004, 2004, 2005, 2006, 2007, 2008, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2003, 2005, 2006, 2006, 2006, 2007, 2008, 2009, 2010, 2010, 2011, 2012, 2013,
+#> 2014, 2015, 1992, 1993, 1995, 1996, 1997, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2015, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2014, 2015, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2005, 2006, 2007, 2008, 2009, 2010,
+#> 2011, 2012, 2013, 2014, 2015, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2009, 2010, 2011, 2012, 2013, 2014, 2014, 2015, 2015, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2009,
+#> 2010, 2011, 2012, 2013, 2013, 2014, 2014, 2015, 2010, 2011, 2012, 2013, 2014, 2015, 2010, 2011, 2012, 2013, 2014, 2015, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2014, 2015, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2009, 2010, 2010, 2011, 2012, 2014, 2015, 2006, 2007, 2008, 2009, 2010, 2011, 2011, 2012, 2013, 2013, 2014, 2015, 2005, 2006, 2007, 2008, 2009, 2010, 2011,
+#> 2012, 2013, 2014, 2015, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2001, 2003, 2004, 2005, 2006, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2002, 2003, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2015, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2014, 2015, 2015, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2004, 2005, 2006, 2007, 2008, 2009, 2009, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2010, 2011, 2012,
+#> 2013, 2014, 2014, 2015, 2015, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2014, 2015, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2010, 2011, 2012, 2013, 2014, 2015, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2012, 2013, 2014, 2011, 2012, 2013, 2014, 2015, 2012, 2013, 2014, 2015, 1998, 1999, 2000, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2014, 2015, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2014, 2006, 2007,
+#> 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2010, 2011, 2012, 2013, 2014, 2015, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2009, 2010, 2011, 2011, 2012, 2013, 2014, 2015, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2011, 2012, 2013, 2014, 2015, 2012, 2013, 2014, 2015, 2011, 2012, 2013, 2014, 2015, 2011, 2012, 2013, 2014, 2015, 2013, 2014, 2015, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2015, 2012, 2013, 2014, 2015, 2013, 2014, 2015, 2013, 2014, 2015, 2013, 2014, 2015, 2008, 2009,
+#> 2010, 2011, 2011, 2012, 2013, 2014, 2015, 2011, 2012, 2013, 2014, 2015, 2010, 2011, 2012, 2013, 2014, 2015, 2001, 2002, 2003, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2010, 2011, 2012, 2013, 2014, 2015, 2011, 2012, 2013, 2014, 2015, 2004, 2005, 2006, 2007, 2008, 2009, 2010, 2011, 2012, 2014, 2015, 2008, 2009, 2010, 2011, 2012, 2012, 2014, 2015, 2015, 2011, 2012, 2013, 2014, 2015, 2011, 2012, 2013, 2014, 2015, 2012, 2013, 2014, 2015, 2011, 2012, 2013, 2014, 2015, 2013,
+#> 2014, 2015, 2013, 2014, 2015, 2010, 2011, 2012, 2013, 2014, 2015, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2014, 2015, 2014, 2015, 2011, 2012, 2013, 2014, 2015, 2012, 2013, 2014, 2015, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2013, 2014, 2015, 2008, 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2012, 2013, 2015, 2010, 2011, 2012, 2013, 2013, 2014, 2015, 2013, 2014, 2015, 2012, 2013, 2014, 2014, 2015, 2015, 2012, 2013, 2014, 2015, 2011, 2012, 2013, 2014, 2015,
+#> 2012, 2013, 2014, 2015, 2012, 2013, 2014, 2015, 2011, 2012, 2013, 2014, 2015, 2010, 2012, 2013, 2014, 2015, 2008, 2009, 2011, 2012, 2013, 2014, 2015, 2015, 2015, 2006, 2007, 2008, 2009, 2010, 2012, 2013, 2014, 2014, 2015, 2011, 2012, 2013, 2014, 2015, 2013, 2014, 2015) x c(18, 59, 57, 26, 26, 26, 26, 26, 139, 28, 61, 143, 144, 32, 32, 35, 35, 107, 107, 107, 107, 107, 107, 107, 107, 147, 147, 62, 62, 26, 106, 148, 74, 74, 74, 74, 74, 74, 74, 74, 106, 6, 107, 107, 107, 107, 107, 26, 26, 26, 26, 27, 38, 89, 121, 121, 121, 121, 121, 121, 36, 121, 38, 135, 135, 135, 92, 92, 89, 89, 89, 89, 89, 95, 89, 102, 102, 102, 139, 35, 35, 35, 35, 26, 26, 26, 26, 26, 42, 42, 42, 62, 89, 89, 89, 89, 89, 89, 89, 89, 38, 35, 35, 36, 25, 26, 26, 26, 26, 26, 26, 26, 26, 26, 84, 102,
+#> 102, 102, 42, 42, 42, 42, 42, 42, 42, 42, 42, 125, 125, 16, 16, 16, 16, 16, 16, 16, 16, 45, 45, 26, 45, 102, 102, 102, 102, 102, 101, 45, 101, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 101, 101, 75, 75, 106, 35, 106, 101, 101, 101, 101, 101, 101, 123, 123, 123, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 38, 89, 93, 93, 93, 93, 93, 93, 93, 93, 33, 93, 29, 33, 29, 38, 38, 38, 89, 16, 16, 16, 16, 33, 33, 33, 33, 33, 29, 42, 42, 42, 125, 125, 16, 16, 16, 16, 16, 16, 16, 16,
+#> 123, 93, 123, 26, 26, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 52, 38, 38, 38, 38, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 16, 123, 123, 123, 123, 123, 123, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 26, 45, 45, 45, 45, 45, 45, 45, 45, 45, 137, 22, 22, 22, 22, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 93, 93, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 101, 101, 42, 42, 42, 42, 42, 125, 125, 125, 123, 123, 123,
+#> 123, 123, 123, 123, 123, 123, 123, 123, 123, 123, 123, 123, 125, 125, 89, 89, 89, 89, 89, 89, 89, 89, 26, 26, 137, 35, 12, 12, 89, 89, 89, 89, 89, 89, 89, 125, 125, 125, 125, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 26, 35, 26, 38, 125, 125, 12, 38, 38, 38, 89, 89, 89, 89, 26, 89, 106, 89, 75, 75, 75, 75, 75, 75, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 125, 35, 35, 35, 35, 35, 35, 35, 35, 35, 38, 21, 124, 34, 35, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22,
+#> 75, 75, 75, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 26, 26, 26, 26, 26, 26, 26, 26, 26, 26, 26, 26, 26, 26, 89, 89, 26, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 26, 26, 26, 26, 102, 33, 26, 26, 26, 26, 26, 26, 26, 26, 26, 106, 106, 106, 106, 125, 35, 35, 35, 35, 35, 35, 35, 35, 22, 35, 22, 87, 26, 26, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 106, 102, 106, 140, 101, 101, 101, 101, 101, 101, 101, 101, 101, 33, 33, 33, 33, 33, 33,
+#> 33, 33, 33, 33, 33, 33, 101, 101, 101, 101, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 38, 26, 38, 38, 140, 140, 140, 140, 93, 125, 16, 16, 16, 16, 16, 16, 16, 16, 16, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 140, 101, 101, 101, 101, 101, 101, 101, 101, 101, 101, 101, 101, 101, 101, 101, 124, 123, 123, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 140, 63, 87, 16, 16, 16, 16, 16, 16, 16, 16,
+#> 45, 45, 45, 45, 45, 45, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 140, 140, 140, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 89, 89, 125, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 93, 93, 75, 75, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 35, 106, 35, 35, 38, 106, 106, 106, 106, 106, 106, 106, 106, 106, 102, 106, 109, 109, 106, 35, 35, 35, 35,
+#> 35, 35, 35, 35, 35, 106, 106, 21, 29, 35, 93, 93, 93, 52, 101, 101, 101, 101, 101, 101, 101, 93, 93, 93, 93, 93, 93, 93, 93, 106, 101, 101, 101, 101, 101, 101, 101, 101, 101, 22, 22, 22, 22, 52, 101, 101, 101, 101, 101, 101, 101, 101, 101, 101, 101, 101, 13, 102, 102, 33, 106, 52, 35, 35, 35, 35, 35, 35, 35, 35, 35, 22, 38, 106, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 26, 26, 26, 38, 38, 38, 35, 35, 35, 35, 106, 93, 93, 101, 101, 101, 101, 101, 101, 101, 93, 93, 93, 93, 93, 93, 38,
+#> 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 45, 45, 45, 16, 45, 16, 16, 101, 140, 101, 101, 45, 45, 45, 45, 45, 33, 45, 33, 33, 33, 33, 33, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 38, 89, 89, 89, 89, 89, 89, 89, 89, 89, 22, 22, 26, 102, 102, 102, 102, 102, 102, 102, 35, 35, 35, 35, 35, 35, 35, 35, 35, 125, 125, 125, 125, 102, 22, 22, 22, 22, 22, 22, 22, 22, 22, 38, 38, 38, 38, 38, 38, 89, 89, 89, 89, 89, 89, 89, 89, 89, 35, 89, 35, 89, 89, 89, 106, 35, 38, 38, 38,
+#> 38, 38, 102, 102, 102, 102, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 22, 89, 22, 22, 22, 22, 22, 38, 26, 26, 26, 26, 101, 101, 101, 101, 101, 101, 101, 101, 101, 16, 16, 16, 16, 45, 26, 26, 106, 106, 102, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 101, 45, 45, 45, 45, 45, 45, 140, 140, 140, 140, 140, 140, 140, 140, 140, 52, 52, 52, 125, 125, 22, 125, 89, 89, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 89, 89, 89, 89, 38, 38, 38, 38, 102, 102, 102, 102, 102, 102,
+#> 102, 35, 35, 35, 38, 106, 106, 106, 106, 106, 106, 125, 125, 125, 89, 89, 89, 89, 89, 89, 89, 101, 101, 101, 101, 101, 16, 16, 16, 93, 93, 93, 93, 93, 123, 123, 123, 123, 101, 52, 106, 140, 140, 140, 45, 140, 45, 45, 45, 45, 63, 21, 87, 101, 101, 101, 101, 101, 101, 101, 101, 16, 101, 16, 16, 16, 106, 106, 106, 106, 106, 16, 33, 140, 102, 102, 102, 102, 102, 102, 102, 102, 102, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 101, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33,
+#> 33, 33, 33, 33, 33, 33, 89, 16, 16, 16, 16, 16, 16, 52, 52, 52, 52, 52, 26, 26, 26, 26, 26, 26, 26, 26, 26, 106, 106, 106, 106, 35, 22, 125, 125, 26, 26, 26, 26, 26, 26, 125, 125, 125, 125, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 38, 38, 38, 102, 26, 26, 26, 26, 93, 93, 93, 93, 93, 123, 33, 33, 33, 33, 33, 33, 33, 33, 33, 89, 38, 89, 38, 38, 38, 38, 38, 38, 38, 38, 89, 89, 89, 89, 89, 106, 125, 125, 125, 125, 125, 125, 125, 89, 125, 89, 89,
+#> 89, 89, 89, 89, 89, 125, 102, 102, 102, 102, 102, 89, 102, 89, 89, 89, 26, 26, 26, 26, 22, 22, 89, 35, 35, 35, 35, 35, 35, 35, 106, 35, 35, 35, 35, 35, 35, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 106, 106, 106, 106, 106, 22, 22, 22, 22, 22, 22, 93, 123, 123, 123, 123, 123, 123, 123, 123, 123, 123, 123, 123, 26, 140, 26, 26, 16, 16, 16, 16, 16, 16, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 26, 89, 89, 26, 26, 89, 89, 89, 38, 38, 38, 89, 89, 26, 26, 35, 35,
+#> 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 89, 26, 35, 35, 35, 35, 123, 125, 123, 123, 123, 123, 89, 26, 89, 26, 26, 26, 26, 26, 26, 26, 26, 26, 26, 26, 89, 89, 89, 26, 26, 89, 89, 89, 89, 89, 35, 89, 35, 35, 106, 89, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 52, 16, 16, 16, 16, 16, 33, 33, 33, 33, 33, 33, 33, 33, 33, 45, 45, 45, 45, 45, 45, 45, 45, 45, 123, 123, 102, 102, 102, 102, 102, 102, 102, 35, 35, 35, 35, 33, 63, 87, 38, 89, 38, 38, 38, 38, 38, 38, 38, 38,
+#> 38, 38, 89, 89, 89, 38, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 22, 106, 22, 22, 22, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 35, 35, 52, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 16, 93, 123, 123, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 33, 33, 33, 33, 33, 93, 93, 93, 93, 140, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 22, 22, 22, 22, 22, 22, 106, 106, 106, 106, 52, 52, 106, 106, 22, 22, 22, 22,
+#> 22, 22, 22, 22, 22, 89, 106, 106, 26, 125, 125, 35, 35, 125, 93, 106, 125, 45, 45, 45, 93, 93, 93, 93, 93, 93, 93, 93, 93, 140, 140, 140, 140, 140, 33, 89, 89, 102, 102, 102, 102, 125, 125, 125, 125, 125, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 125, 125, 38, 125, 125, 26, 26, 26, 89, 89, 89, 89, 89, 26, 89, 26, 26, 22, 22, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 45, 38, 45, 45, 45, 45, 45, 45, 45, 106, 101, 45, 45, 45, 45, 45,
+#> 45, 45, 45, 45, 140, 140, 140, 93, 93, 93, 123, 123, 123, 123, 123, 123, 123, 93, 93, 93, 93, 16, 16, 16, 16, 16, 16, 16, 16, 93, 93, 93, 93, 140, 33, 38, 106, 106, 106, 106, 106, 106, 106, 106, 106, 125, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 16, 16, 16, 16, 16, 93, 93, 93, 93, 93, 38, 38, 38, 38, 38, 89, 89, 89, 89, 89, 89, 89, 89, 89, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 89, 89, 89, 106, 89, 89,
+#> 89, 89, 89, 89, 89, 89, 38, 38, 38, 35, 38, 22, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 26, 26, 26, 26, 26, 89, 89, 89, 89, 89, 89, 89, 38, 89, 35, 38, 35, 35, 101, 101, 101, 101, 101, 16, 93, 93, 93, 93, 93, 93, 93, 26, 52, 101, 101, 101, 101, 101, 101, 16, 16, 16, 16, 93, 93, 93, 123, 106, 140, 89, 106, 101, 101, 101, 101, 101, 101, 101, 101, 101, 101, 101, 101, 101, 101, 102, 102, 102, 102, 102, 102, 102, 102, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 35, 38, 38, 38, 38,
+#> 22, 22, 22, 22, 140, 93, 140, 93, 52, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 38, 38, 38, 101, 101, 101, 101, 101, 101, 101, 101, 101, 101, 101, 101, 101, 101, 101, 93, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 38, 38, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 52, 52, 52, 52, 52, 89, 93, 93, 45, 29, 52, 52, 52, 52, 52, 52, 16, 16, 16, 16, 101, 101, 101, 101, 101, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 93, 93, 93, 101, 125, 106, 106, 106, 106, 106, 106, 35, 35, 35, 35,
+#> 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 125, 125, 125, 89, 125, 89, 89, 89, 89, 125, 35, 38, 125, 26, 26, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 22, 22, 89, 89, 89, 89, 106, 106, 106, 106, 106, 106, 106, 106, 22, 22, 93, 106, 93, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 125, 38, 125, 22, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 16, 22, 16, 45, 45, 52, 52, 52, 52, 52, 52, 52, 140, 140, 101, 140, 101, 45,
+#> 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 33, 123, 33, 33, 33, 140, 22, 22, 22, 22, 101, 101, 101, 16, 101, 16, 16, 16, 16, 16, 16, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 16, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 89, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140,
+#> 123, 93, 93, 93, 93, 16, 16, 140, 140, 140, 140, 140, 140, 140, 140, 16, 52, 52, 123, 33, 101, 101, 101, 101, 101, 101, 101, 101, 101, 52, 52, 52, 52, 101, 101, 101, 101, 101, 101, 101, 101, 101, 33, 33, 33, 52, 140, 140, 26, 38, 101, 101, 16, 101, 140, 140, 140, 140, 140, 140, 140, 140, 140, 123, 140, 123, 123, 140, 52, 52, 52, 52, 140, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 106, 106, 106, 106, 106, 106, 106, 35, 35, 35, 35, 35, 35, 35, 35, 38, 38, 38,
+#> 22, 106, 106, 106, 106, 106, 22, 22, 22, 22, 22, 33, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 38, 38, 38, 123, 123, 89, 89, 89, 89, 26, 89, 26, 106, 106, 106, 106, 106, 125, 125, 125, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 89, 45, 89, 16, 52, 52, 52, 52, 101, 101, 45, 101, 45, 16, 16, 45, 45, 45, 45, 45, 93, 93, 101, 33, 33, 33, 33, 33, 33, 33, 33, 33, 45, 45, 45, 45, 45, 52, 52, 52, 52, 52, 123, 123, 123, 140, 140, 140, 140, 140, 140, 16, 22, 22, 106, 106, 33, 33, 33, 33, 33, 33,
+#> 33, 33, 33, 33, 101, 101, 101, 101, 101, 101, 101, 101, 101, 16, 16, 16, 16, 16, 16, 16, 16, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 89, 89, 89, 35, 35, 35, 35, 35, 35, 22, 22, 22, 102, 106, 106, 106, 106, 106, 106, 106, 102, 102, 102, 35, 102, 35, 35, 35, 45, 22, 22, 22, 22, 106, 35, 106, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 35, 22, 89, 89, 16, 16, 93, 93, 93, 93, 93, 93, 93, 93, 93, 52, 93, 52, 101, 22, 89,
+#> 106, 106, 106, 106, 22, 106, 22, 33, 33, 33, 33, 33, 33, 33, 140, 140, 140, 102, 140, 123, 16, 123, 123, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 38, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 22, 26, 26, 22, 22, 93, 93, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 102, 102, 102, 102, 102, 102, 125, 125, 125, 125, 125, 125, 102, 102, 102, 102,
+#> 102, 38, 38, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 26, 38, 106, 102, 22, 106, 106, 140, 123, 140, 123, 123, 123, 140, 140, 140, 140, 52, 140, 52, 52, 35, 16, 16, 16, 16, 26, 26, 26, 26, 26, 89, 89, 89, 38, 89, 38, 38, 38, 38, 26, 125, 125, 125, 125, 125, 125, 125, 125, 38, 38, 38, 38, 38, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 26, 125, 26, 26, 125, 89, 89, 89, 89, 89, 89, 89, 89, 89, 106, 106, 35, 22, 38, 38, 38, 38, 102, 45, 45, 45, 45, 33, 45,
+#> 33, 33, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 101, 101, 101, 101, 101, 101, 101, 101, 101, 101, 101, 101, 101, 101, 101, 33, 33, 33, 33, 33, 33, 33, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 101, 101, 101, 101, 101, 101, 33, 22, 33, 22, 125, 101, 101, 101, 101, 123, 123, 123, 123, 123, 123, 45, 45, 45, 45, 45, 45, 45, 16, 16, 16, 16, 140, 93, 140, 93, 22, 26, 123, 123, 123, 123, 123, 33, 123, 33, 33, 140, 140, 140, 123, 52, 123, 52, 89, 35, 35, 35, 35,
+#> 35, 35, 35, 93, 93, 93, 89, 26, 26, 38, 38, 38, 38, 38, 38, 38, 38, 106, 106, 106, 106, 106, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 93, 93, 93, 16, 89, 102, 102, 22, 22, 22, 89, 89, 101, 101, 101, 101, 101, 101, 101, 101, 101, 101, 101, 16, 16, 16, 16, 16, 16, 16, 35, 35, 102, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 52, 52, 26, 106, 106, 140, 140, 140, 140, 140, 140, 140, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 125, 125, 125, 125, 125, 125, 125, 125, 125, 38, 125,
+#> 38, 102, 123, 123, 123, 123, 123, 123, 123, 123, 123, 16, 123, 16, 16, 89, 101, 101, 101, 101, 101, 101, 101, 101, 101, 101, 101, 16, 16, 16, 16, 26, 26, 26, 26, 26, 26, 26, 26, 22, 106, 106, 125, 125, 38, 125, 38, 38, 38, 38, 38, 38, 38, 38, 38, 35, 35, 35, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 22, 89, 22, 22, 22, 22, 22, 22, 102, 102, 102, 102, 102, 102, 35, 35, 35, 102, 102, 102, 102, 106, 102, 102, 102, 102, 102, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 140, 35, 35, 35, 35,
+#> 35, 35, 35, 125, 125, 125, 125, 125, 35, 125, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 22, 35, 22, 22, 22, 26, 106, 45, 22, 22, 22, 22, 22, 22, 22, 89, 22, 89, 22, 22, 22, 125, 125, 125, 125, 125, 125, 125, 35, 35, 35, 35, 123, 106, 106, 106, 106, 102, 102, 102, 102, 89, 89, 89, 89, 35, 52, 52, 89, 89, 89, 89, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 101, 101, 101, 101, 101, 16, 16, 52, 52, 52, 52, 52, 52, 16, 52, 140, 140, 140, 140, 140, 140, 123, 123, 123, 123,
+#> 123, 123, 140, 140, 140, 140, 33, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 140, 140, 140, 140, 45, 45, 35, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 26, 26, 26, 26, 26, 26, 26, 26, 89, 38, 89, 38, 38, 102, 22, 22, 22, 22, 22, 22, 22, 26, 26, 26, 26, 26, 106, 106, 106, 106, 106, 106, 106, 45, 125, 125, 125, 125, 125, 125, 125, 125, 22, 125, 22, 22, 22, 89, 89, 26, 89, 22, 125, 125, 89, 26, 89, 26, 26, 26, 26, 26, 26, 26, 26, 22, 89, 106, 106, 106, 106, 106, 106, 106, 106, 106,
+#> 106, 22, 22, 22, 22, 93, 16, 93, 16, 16, 16, 101, 101, 38, 38, 38, 89, 52, 52, 52, 52, 52, 52, 52, 52, 52, 22, 52, 102, 102, 102, 102, 102, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 123, 93, 93, 93, 33, 101, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 106,
+#> 101, 101, 101, 101, 101, 101, 101, 16, 16, 16, 16, 16, 140, 52, 52, 52, 52, 52, 52, 52, 45, 45, 45, 45, 45, 45, 45, 123, 16, 16, 22, 22, 140, 52, 52, 52, 52, 52, 52, 52, 52, 16, 16, 16, 16, 16, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 52, 52, 52, 52, 52, 52, 33, 33, 16, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 33, 33, 33, 33, 52, 52, 123, 123, 123, 140, 45, 45, 45, 102, 38, 102, 93, 93, 93, 93, 45, 45, 45, 45, 45, 22, 123, 22, 22, 89, 89, 101, 101, 101, 101, 101,
+#> 101, 101, 33, 33, 33, 33, 16, 33, 16, 16, 101, 101, 101, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 106, 106, 106, 106, 106, 106, 106, 106, 106, 102, 106, 102, 106, 106, 106, 106, 106, 106, 35, 35, 35, 35, 35, 35, 22, 35, 22, 16, 16, 16, 16, 16, 16, 16, 93, 93, 93, 26, 38, 26, 26, 26, 26, 106, 140, 26, 45, 45, 52, 52, 52, 52, 52, 52, 123, 123, 102, 102, 102, 102, 102, 26, 102, 26, 26, 26, 102, 102,
+#> 102, 102, 26, 26, 26, 22, 26, 26, 125, 125, 125, 125, 125, 125, 89, 89, 89, 89, 89, 93, 93, 93, 93, 93, 35, 35, 35, 35, 35, 35, 89, 89, 26, 89, 26, 125, 123, 26, 26, 26, 38, 38, 38, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 16, 16, 16, 16, 16, 16, 16, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 33, 106, 106, 106, 35, 106, 35, 38, 123, 123, 123, 123, 123, 45, 45, 45, 45, 38, 93, 93, 93, 102, 102, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 123, 140, 123, 26, 26, 22, 22, 35,
+#> 123, 123, 140, 140, 16, 140, 123, 52, 123, 52, 52, 22, 140, 22, 123, 140, 101, 101, 101, 140, 93, 140, 89, 101, 140, 101, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 35, 45, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 102, 26, 102, 26, 22, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 26, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 89, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 102, 102, 26, 102, 26, 35, 38, 38, 38, 38, 38, 38, 38, 38, 35, 35, 93, 93, 93, 93, 93, 93, 93, 45, 45, 45, 45, 101, 101,
+#> 101, 101, 101, 101, 101, 101, 101, 101, 140, 16, 16, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 22, 22, 22, 22, 140, 140, 140, 140, 140, 140, 140, 140, 140, 102, 102, 35, 35, 35, 35, 35, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 26, 26, 16, 16, 102, 102, 102, 102, 38, 102, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 26, 102, 102, 35, 102, 35, 125, 125, 22, 125, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 35, 38, 38, 38, 38, 38, 38, 38, 35, 93,
+#> 89, 93, 106, 106, 106, 22, 22, 22, 22, 22, 22, 22, 89, 89, 89, 89, 89, 89, 35, 35, 35, 89, 123, 123, 123, 123, 123, 123, 123, 123, 123, 123, 140, 140, 140, 101, 101, 101, 101, 101, 101, 101, 101, 101, 123, 123, 101, 45, 101, 33, 45, 16, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 52, 52, 93, 101, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 102, 102, 102, 102, 102, 38, 38, 26, 26, 26, 26, 38, 38, 38, 38, 38, 102, 102, 125, 16, 16, 16, 16, 16, 16, 16, 102, 102, 45, 45, 45, 45, 33, 33, 33, 33, 33, 33, 33, 33,
+#> 33, 33, 33, 89, 16, 16, 16, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 140, 35, 35, 102, 102, 102, 102, 22, 22, 22, 22, 22, 22, 16, 125, 125, 125, 125, 125, 125, 125, 106, 52, 52, 52, 52, 33, 52, 33, 33, 33, 45, 22, 22, 22, 22, 22, 22, 102, 125, 125, 125, 125, 26, 26, 26, 38, 38, 38, 38, 38, 38, 38, 38, 106, 106, 125, 125, 125, 125, 125, 22, 22, 22, 22, 22, 22, 26, 26, 106, 45, 35, 35, 35, 102, 102, 22, 22, 22, 22, 22, 106, 106, 89, 106, 89, 125, 125, 125, 125, 125, 125, 125, 125, 125,
+#> 125, 125, 125, 125, 93, 64, 93, 64, 93, 93, 93, 80, 93, 35, 35, 35, 35, 35, 35, 35, 35, 89, 89, 89, 89, 89, 89, 89, 35, 35, 22, 22, 22, 26, 26, 26, 93, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 16, 16, 16, 16, 16, 16, 16, 16, 16, 93, 93, 93, 93, 93, 93, 93, 106, 106, 106, 16, 16, 16, 45, 45, 45, 45, 45, 16, 106, 101, 101, 101, 101, 101, 101, 101, 101, 16, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 16, 16, 140, 140, 140, 140, 140, 16, 16, 123, 123, 123, 123, 123, 123, 123, 123, 16, 16, 16,
+#> 16, 16, 33, 123, 5, 5, 33, 125, 125, 125, 125, 125, 125, 125, 26, 125, 26, 26, 89, 35, 102, 102, 102, 102, 38, 125, 125, 125, 26, 26, 26, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 123, 123, 125, 125, 125, 125, 22, 22, 22, 22, 22, 35, 35, 35, 16, 16, 16, 16, 16, 16, 16, 16, 16, 52, 52, 52, 140, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 16, 16, 33, 101, 93, 93, 93, 93, 93, 93, 93, 125, 125, 125, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 16, 52, 5, 89, 89, 89, 89, 102, 102, 45,
+#> 45, 45, 45, 45, 45, 52, 52, 52, 52, 52, 52, 52, 93, 89, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 52, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 125, 125, 125, 125, 125, 125, 89, 89, 89, 38, 89, 26, 38, 26, 26, 80, 35, 106, 35, 125, 125, 26, 26, 38, 38, 106, 106, 106, 106, 106, 102, 89, 102, 93, 93, 93, 93, 93, 93, 93, 93, 123, 45, 45, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 45, 45, 106, 106,
+#> 106, 106, 106, 106, 106, 106, 26, 26, 26, 26, 26, 89, 33, 123, 125, 125, 125, 125, 26, 26, 26, 125, 125, 102, 125, 102, 35, 102, 35, 26, 35, 89, 89, 89, 89, 89, 26, 89, 26, 26, 35, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 93, 93, 93, 93, 33, 93, 33, 52, 22, 52, 22, 22, 22, 22, 22, 22, 22, 22, 106, 106, 101, 101, 102, 102, 93, 93, 93, 93, 102, 38, 38, 22, 22, 22, 22, 26, 26, 26, 26, 26, 89, 26, 26, 33, 33, 33, 22, 89, 89, 89, 101, 52, 52, 52, 52, 16, 16, 16, 16, 16, 16, 45, 45, 45,
+#> 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 52, 52, 52, 52, 52, 101, 101, 101, 140, 140, 140, 45, 106, 52, 52, 22, 123, 123, 93, 123, 140, 45, 45, 45, 52, 52, 52, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 33, 33, 125, 125, 125, 125, 125, 125, 125, 125, 125, 35, 35, 35, 35, 35, 35, 35, 35, 22, 35, 22, 80, 80, 80, 80, 80, 80, 80, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 123, 93, 93, 93, 35, 93, 35, 35, 35, 102, 52, 102, 106, 52, 26, 26, 26, 26, 26, 26,
+#> 26, 26, 26, 26, 22, 38, 38, 38, 38, 26, 26, 26, 125, 125, 26, 26, 26, 35, 35, 35, 35, 35, 35, 101, 101, 140, 22, 22, 22, 22, 22, 22, 89, 89, 26, 26, 101, 52, 52, 52, 52, 52, 140, 140, 140, 140, 140, 140, 140, 140, 45, 45, 140, 140, 140, 140, 140, 140, 16, 16, 45, 80, 106, 101, 101, 101, 52, 101, 52, 52, 52, 52, 52, 16, 52, 16, 16, 33, 33, 5, 33, 5, 93, 93, 93, 93, 33, 52, 52, 16, 52, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 16, 16, 125, 125, 125, 125, 125, 125, 125, 125, 106, 125, 106,
+#> 35, 106, 35, 35, 33, 106, 35, 22, 35, 22, 22, 22, 26, 26, 89, 89, 125, 125, 35, 35, 35, 35, 35, 35, 35, 106, 106, 106, 106, 35, 35, 35, 35, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 125, 125, 33, 38, 26, 26, 26, 26, 26, 26, 26, 93, 93, 93, 93, 64, 93, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 72, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 38, 123, 123, 123, 123, 123, 123, 123, 123, 101, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93,
+#> 94, 45, 45, 45, 45, 45, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 22, 22, 22, 22, 22, 22, 35, 35, 35, 140, 38, 38, 38, 38, 38, 38, 38, 38, 38, 93, 93, 64, 106, 106, 106, 106, 106, 106, 106, 35, 106, 35, 45, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 52, 52, 93, 22, 26, 26, 26, 26, 26, 26, 26, 26, 80, 80, 80, 80, 80, 80, 80, 80, 80, 80, 80, 80, 94, 117, 89, 89, 89, 89, 89, 26, 26, 26, 38, 38, 33, 33, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 101, 101, 101, 101, 101, 101,
+#> 33, 33, 45, 52, 52, 52, 52, 52, 52, 52, 52, 52, 16, 52, 16, 16, 16, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 93, 93, 93, 93, 93, 93, 93, 93, 125, 64, 125, 26, 26, 26, 26, 26, 26, 26, 26, 26, 26, 26, 106, 33, 33, 33, 35, 35, 35, 35, 35, 35, 35, 22, 35, 22, 38, 93, 93, 140, 140, 140, 5, 16, 26, 26, 26, 89, 89, 89, 89, 89, 89, 89, 125, 125, 35, 125, 35, 80, 102, 93, 93, 93, 93, 93, 93, 93, 106, 33, 33, 33, 33, 33, 33, 33, 33, 140, 140, 101, 123, 140, 101, 33, 16, 16, 16, 16,
+#> 16, 16, 16, 16, 16, 16, 52, 52, 52, 52, 52, 52, 123, 123, 5, 45, 45, 45, 45, 45, 16, 16, 16, 52, 52, 52, 79, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 72, 72, 72, 72, 94, 94, 89, 89, 89, 89, 89, 89, 89, 26, 26, 26, 80, 106, 89, 106, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 38, 72, 38, 38, 45, 123, 123, 123, 123, 123, 140, 140, 140, 140, 140, 140, 33, 33, 102, 102, 102, 141, 141, 123, 123, 16, 16, 16, 16, 16, 16, 16, 16, 33, 125, 33, 93, 93, 93, 93, 93, 93, 93, 93,
+#> 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 16, 16, 16, 16, 52, 52, 52, 33, 33, 33, 33, 38, 5, 38, 5, 5, 52, 52, 52, 52, 52, 52, 52, 45, 52, 45, 45, 45, 5, 45, 38, 26, 102, 102, 102, 102, 102, 102, 93, 102, 93, 93, 125, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 72, 72, 72, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 72, 72, 72, 72, 72, 94, 117, 89, 89, 89, 89, 89, 89, 89, 89, 38, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 45, 102, 64, 26, 26, 26,
+#> 106, 45, 45, 45, 45, 45, 45, 45, 45, 45, 33, 33, 45, 33, 52, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 89, 89, 89, 89, 89, 89, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 94, 117, 94, 89, 89, 89, 89, 89, 89, 45, 89, 22, 45, 22, 93, 93, 125, 125, 106, 106, 106, 106, 22, 22, 22, 22, 22, 22, 22, 101, 101, 101, 101, 101, 101, 64, 64, 93, 93, 93, 93, 106, 58, 125, 125, 35, 102, 125, 38, 38, 38, 38, 35, 38, 35, 35, 35, 35, 35, 35, 125, 89, 117, 117, 101, 101, 101, 93, 5, 33, 33,
+#> 52, 22, 22, 22, 22, 38, 38, 140, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 5, 5, 5, 5, 58, 35, 58, 45, 45, 45, 45, 45, 45, 93, 93, 93, 93, 93, 93, 64, 93, 52, 45, 38, 79, 80, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 52, 52, 52, 52, 52, 52, 52, 52, 45, 117, 117, 117, 117, 35, 117, 35, 102, 22, 22, 22, 22, 22, 72, 72, 72, 72, 72, 72, 72, 72, 72, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 89,
+#> 125, 80, 89, 80, 80, 80, 125, 125, 125, 93, 93, 93, 93, 140, 140, 140, 140, 140, 16, 16, 16, 106, 35, 106, 106, 89, 89, 89, 89, 89, 89, 117, 93, 93, 93, 93, 64, 93, 64, 38, 45, 125, 64, 125, 125, 125, 125, 125, 72, 72, 72, 72, 72, 72, 72, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 106, 33, 106, 33, 71, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 5, 16, 80, 26, 26, 26, 80, 89, 89, 89, 89, 117, 117, 117, 45, 80, 38, 38, 116, 116, 116, 116, 116, 35, 86, 22, 22, 22, 22, 72, 72, 72, 72, 72, 72, 72, 72, 52,
+#> 72, 52, 114, 45, 45, 45, 45, 45, 33, 33, 33, 125, 106, 125, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 101, 101, 101, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 58, 58, 26, 80, 80, 80, 80, 80, 80, 80, 80, 80, 80, 80, 80, 80, 4, 52, 58, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 123, 5, 93, 93,
+#> 93, 93, 93, 64, 33, 64, 117, 117, 58, 117, 5, 58, 35, 33, 33, 33, 33, 33, 33, 33, 5, 5, 5, 5, 5, 33, 33, 33, 16, 16, 16, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 5, 5, 5, 5, 5, 5, 72, 30, 30, 45, 45, 45, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 94, 33, 94, 33, 72, 72, 80, 80, 80, 80, 80, 80, 80, 80, 80, 80, 80, 80, 4, 4, 4, 4, 4, 4, 4, 4, 4, 83, 83, 52, 52, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 117, 117, 117, 93, 26, 26, 80, 80, 80, 80, 80, 80, 80, 80, 80, 80, 80, 125,
+#> 35, 125, 35, 102, 30, 30, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 30, 45, 93, 93, 123, 123, 123, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 45, 33, 45, 33, 33, 33, 33, 33, 33, 45, 45, 33, 33, 125, 141, 33, 33, 33, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 80, 80, 80, 80, 94, 94, 94, 93, 93, 93, 93, 93, 93, 93, 93, 93, 102, 102, 102, 117, 117, 117, 117, 117, 117, 30, 117, 30, 30, 64, 52, 52, 52, 52, 52, 52, 52, 52, 52, 102, 102, 102, 102, 106, 72, 106, 102, 102, 93, 93, 93, 93, 93, 93, 93,
+#> 93, 93, 93, 93, 93, 16, 93, 16, 123, 123, 5, 93, 93, 93, 93, 93, 93, 93, 93, 16, 71, 101, 64, 64, 64, 45, 64, 45, 45, 45, 79, 79, 71, 79, 102, 30, 52, 52, 52, 52, 52, 52, 80, 80, 80, 80, 80, 4, 16, 16, 16, 16, 16, 16, 16, 16, 45, 45, 45, 141, 71, 94, 141, 71, 30, 30, 30, 93, 93, 93, 64, 64, 64, 64, 5, 5, 30, 16, 117, 16, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 26, 26, 80, 80, 80, 80, 80, 80, 80, 80, 80, 80, 80, 117, 106, 45, 125, 125, 125, 125, 102, 125,
+#> 102, 38, 106, 106, 106, 106, 106, 5, 5, 93, 93, 93, 140, 140, 16, 16, 16, 16, 16, 16, 16, 140, 5, 140, 5, 71, 71, 71, 71, 30, 30, 117, 117, 117, 117, 117, 117, 117, 117, 117, 125, 125, 125, 4, 4, 4, 4, 96, 16, 66, 106, 106, 106, 106, 106, 106, 106, 106, 38, 35, 35, 80, 94, 94, 94, 102, 58, 80, 102, 35, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 93, 94, 72, 72, 72, 72, 72, 72, 52, 52, 52, 52, 58, 30, 140, 140, 140, 140, 140, 140, 140, 140, 45, 45, 45, 45, 45, 45, 45,
+#> 45, 45, 33, 33, 33, 33, 33, 45, 22, 22, 72, 72, 72, 72, 94, 38, 94, 89, 125, 117, 117, 5, 5, 5, 5, 5, 5, 102, 58, 102, 140, 140, 140, 79, 79, 79, 79, 79, 79, 79, 79, 79, 79, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 114, 114, 96, 114, 117, 117, 117, 117, 45, 45, 35, 35, 125, 125, 117, 117, 117, 52, 125, 5, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 33, 33, 33,
+#> 33, 33, 140, 79, 79, 79, 79, 79, 79, 79, 33, 33, 33, 33, 33, 33, 33, 33, 64, 45, 16, 52, 58, 45, 45, 64, 64, 93, 93, 93, 93, 93, 93, 93, 125, 125, 89, 117, 125, 125, 125, 125, 125, 125, 125, 102, 102, 102, 125, 106, 106, 106, 106, 106, 106, 106, 106, 106, 125, 125, 125, 102, 102, 117, 5, 5, 5, 5, 5, 33, 33, 33, 33, 33, 33, 141, 33, 93, 93, 66, 72, 72, 72, 72, 72, 72, 72, 141, 141, 141, 141, 141, 141, 141, 52, 131, 52, 93, 93, 93, 93, 93, 93, 93, 93, 93, 72, 33, 141, 33, 33, 30, 33, 125, 125, 125,
+#> 125, 125, 35, 125, 35, 35, 140, 33, 33, 33, 5, 33, 5, 16, 16, 16, 16, 16, 16, 16, 79, 125, 125, 125, 125, 125, 125, 125, 125, 35, 35, 35, 117, 117, 93, 117, 93, 93, 93, 93, 93, 66, 66, 5, 5, 5, 5, 5, 35, 94, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 80, 94, 33, 94, 22, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 79, 79, 141, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38,
+#> 38, 125, 45, 45, 30, 30, 66, 66, 72, 72, 72, 72, 72, 72, 72, 72, 106, 106, 72, 86, 72, 72, 72, 16, 16, 106, 106, 106, 4, 106, 4, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 96, 96, 33, 33, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 45, 45, 45, 45, 45, 52, 52, 52, 52, 64, 45, 45, 33, 45, 72, 93, 35, 35, 102, 102, 102, 38, 102, 38, 38, 38, 106, 106, 106, 106, 106, 33, 106, 33, 33, 33, 80, 80, 80, 80, 80, 80, 80, 38, 38, 38, 38, 38, 4, 38, 125, 106, 106, 38, 93,
+#> 93, 93, 93, 125, 125, 125, 102, 125, 89, 117, 117, 117, 117, 117, 5, 5, 5, 5, 5, 4, 117, 117, 125, 71, 71, 71, 45, 45, 45, 45, 33, 45, 117, 93, 64, 93, 64, 64, 93, 93, 93, 93, 93, 93, 45, 64, 94, 94, 22, 22, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 140, 140, 79, 79, 79, 79, 79, 79, 79, 79, 79, 79, 79, 79, 33, 79, 33, 33, 102, 102, 102, 93, 102, 93, 125, 125, 125, 125, 35, 35, 35, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 93, 93, 93, 93, 93, 93, 93, 93, 52, 93, 26, 26,
+#> 26, 52, 33, 33, 33, 33, 33, 33, 141, 45, 45, 45, 45, 72, 72, 72, 72, 72, 72, 72, 72, 94, 33, 58, 115, 35, 58, 96, 96, 5, 35, 5, 5, 5, 30, 66, 106, 106, 106, 106, 38, 38, 38, 38, 38, 38, 38, 125, 106, 16, 16, 16, 16, 16, 45, 35, 45, 52, 86, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 52, 106, 86, 22, 22, 22, 72, 72, 72, 72, 72, 72, 72, 72, 72, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 140, 140, 79, 79, 79, 79, 79, 79, 79,
+#> 72, 45, 141, 4, 38, 38, 38, 38, 38, 38, 38, 125, 58, 58, 58, 58, 58, 58, 38, 38, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 141, 102, 102, 102, 102, 102, 102, 102, 102, 86, 86, 86, 86, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 16, 16, 16, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 102, 102, 102, 102, 102, 38, 86, 38, 38, 93, 93, 93, 93, 93, 93, 93, 93, 35, 58, 35, 35, 4, 35, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 16, 72, 33, 33,
+#> 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 35, 35, 93, 93, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 71, 71, 71, 71, 30, 30, 79, 79, 79, 45, 94, 52, 45, 45, 45, 45, 45, 30, 45, 30, 125, 125, 106, 106, 96, 106, 96, 72, 72, 72, 72, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 33, 125, 102, 102, 102, 102, 102, 102, 93, 93, 93, 30, 79, 79, 79, 79, 79, 79, 79, 79, 79, 79, 79, 79, 79, 79, 79, 102, 102, 102, 102, 102, 102, 102, 125, 72, 33, 33,
+#> 33, 102, 102, 96, 106, 106, 106, 106, 106, 16, 16, 102, 72, 94, 30, 140, 140, 140, 140, 140, 140, 140, 79, 79, 79, 79, 79, 79, 79, 79, 79, 79, 79, 79, 79, 79, 66, 71, 71, 71, 71, 30, 30, 30, 30, 30, 30, 30, 94, 94, 131, 131, 131, 131, 106, 131, 106, 94, 94, 94, 94, 72, 117, 117, 117, 86, 86, 86, 86, 125, 80, 80, 80, 80, 80, 80, 4, 4, 4, 125, 125, 125, 125, 125, 125, 94, 94, 94, 106, 106, 106, 106, 106, 106, 106, 106, 72, 114, 72, 106, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 38,
+#> 38, 38, 38, 38, 38, 38, 38, 38, 79, 79, 79, 30, 45, 131, 131, 5, 5, 5, 5, 58, 93, 93, 96, 96, 114, 72, 72, 72, 72, 72, 72, 72, 72, 125, 45, 45, 45, 45, 45, 38, 38, 86, 79, 79, 79, 79, 30, 30, 45, 35, 45, 93, 4, 35, 45, 45, 45, 45, 45, 45, 45, 79, 79, 79, 79, 72, 86, 125, 96, 106, 96, 106, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 64, 93, 64, 38, 38, 38, 38, 4, 102, 102, 102, 102, 96, 102, 16, 83, 96, 16, 33, 16, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106,
+#> 106, 106, 106, 106, 106, 117, 117, 117, 33, 33, 33, 33, 5, 33, 5, 45, 30, 30, 30, 30, 33, 33, 125, 140, 140, 140, 140, 45, 45, 35, 4, 35, 38, 38, 35, 35, 66, 125, 66, 66, 71, 30, 30, 30, 30, 30, 33, 33, 66, 66, 45, 45, 45, 33, 33, 33, 94, 94, 94, 94, 94, 58, 125, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 38, 38, 38, 38, 38, 38, 38, 38, 58, 58, 58, 58, 106, 16, 106, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 45, 45, 72, 141, 141, 141, 141, 141, 141, 141, 4, 4, 4, 16, 16, 16, 16, 16, 16,
+#> 16, 52, 52, 52, 52, 52, 114, 117, 117, 117, 117, 117, 117, 80, 80, 4, 4, 4, 4, 96, 93, 96, 93, 86, 93, 83, 64, 64, 64, 64, 96, 93, 115, 93, 93, 35, 93, 35, 4, 94, 52, 52, 52, 52, 52, 52, 72, 72, 35, 72, 35, 35, 35, 33, 35, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 86, 86, 86, 16, 16, 16, 102, 38, 38, 38, 35, 35, 35, 35, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 16, 16, 16, 16, 16, 16, 16, 83, 102, 102, 102, 102, 102, 102, 102, 89, 89, 117, 117, 117,
+#> 117, 117, 5, 5, 141, 141, 117, 117, 117, 93, 117, 66, 16, 16, 16, 16, 16, 16, 83, 83, 83, 83, 83, 16, 16, 16, 66, 93, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 93, 93, 38, 93, 93, 72, 72, 72, 72, 72, 72, 72, 72, 72, 117, 117, 35, 35, 35, 35, 35, 35, 35, 35, 79, 114, 35, 35, 79, 79, 79, 79, 79, 79, 79, 79, 79, 79, 79, 79, 30, 30, 30, 30, 30, 30, 30, 94, 94, 94, 94, 94, 94, 94, 94, 94, 94, 38, 94, 38, 38, 38, 38, 38, 94, 33, 33, 16, 33, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 102, 102, 86, 102,
+#> 125, 16, 125, 16, 102, 102, 102, 102, 102, 102, 58, 58, 58, 58, 58, 58, 58, 58, 58, 58, 58, 72, 72, 4, 83, 93, 102, 35, 102, 35, 35, 35, 35, 35, 35, 35, 131, 131, 16, 16, 131, 131, 131, 131, 35, 35, 30, 30, 30, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 94, 114, 114, 52, 52, 52, 52, 52, 52, 52, 52, 141, 4, 96, 16, 16, 16, 16, 16, 16, 16, 16, 125, 125, 72, 125, 72, 72, 72, 72, 72, 117, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 35, 35, 35, 35, 35, 35, 35, 35, 35, 114, 114,
+#> 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 96, 125, 96, 106, 96, 106, 96, 93, 93, 93, 93, 93, 33, 33, 33, 33, 96, 96, 86, 96, 86, 86, 86, 86, 30, 102, 64, 64, 64, 64, 141, 16, 64, 141, 16, 16, 45, 45, 45, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 131, 45, 96, 134, 116, 116, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 86, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 125, 33, 125, 33, 33, 16, 16, 16, 16, 106,
+#> 106, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 94, 94, 94, 94, 38, 125, 58, 58, 58, 58, 5, 5, 5, 5, 5, 5, 5, 5, 30, 5, 5, 5, 5, 5, 5, 5, 5, 4, 4, 4, 102, 35, 102, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 72, 4, 4, 4, 4, 4, 4, 4, 94, 94, 94, 94, 94, 64, 64, 64, 93, 93, 93, 93, 93, 93, 93, 93, 4, 4, 4, 4, 4, 5, 45, 66, 66, 66, 66, 66, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 72, 72, 125, 125, 125, 125, 125, 72, 102, 102, 16, 35, 16, 64, 96, 96, 96, 96, 96,
+#> 96, 96, 96, 5, 93, 93, 93, 93, 93, 30, 30, 30, 30, 30, 96, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 125, 125, 125, 125, 125, 125, 125, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 33, 102, 117, 45, 79, 79, 117, 117, 117, 117, 117, 117, 106, 106, 106, 106, 106, 125, 96, 125, 93, 125, 114, 94, 94, 94, 94, 94, 94, 94, 94, 94, 94, 94, 94, 33, 72, 72, 72, 72, 72, 72, 72, 79, 79, 79, 52, 79, 52, 72, 30, 125, 38, 38, 38, 79, 93, 125, 33, 58, 86, 106, 106, 106, 106, 106,
+#> 106, 106, 106, 86, 94, 94, 94, 125, 45, 45, 45, 45, 45, 79, 79, 79, 79, 79, 79, 79, 79, 79, 79, 52, 45, 45, 96, 30, 30, 30, 30, 30, 30, 131, 131, 131, 33, 33, 93, 93, 93, 93, 96, 96, 45, 45, 45, 45, 45, 45, 96, 96, 96, 45, 45, 116, 83, 33, 33, 33, 33, 33, 33, 33, 33, 33, 30, 30, 30, 83, 45, 58, 58, 58, 58, 58, 58, 58, 58, 58, 114, 114, 134, 16, 16, 16, 16, 16, 16, 30, 16, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 86, 86, 86, 86, 4, 4, 4, 4, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 117, 93, 117,
+#> 93, 106, 79, 79, 79, 79, 38, 38, 38, 38, 131, 131, 131, 125, 125, 125, 125, 38, 38, 38, 38, 114, 114, 102, 102, 106, 114, 96, 96, 96, 96, 96, 96, 96, 96, 96, 117, 117, 117, 117, 66, 66, 117, 117, 94, 94, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 106, 117, 117, 117, 117, 117, 117, 117, 93, 30, 30, 33, 131, 45, 125, 35, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 86, 125, 131, 114, 30, 94, 94, 94, 94, 94, 94, 94, 94, 94, 94, 94, 94, 94, 102, 102, 131, 45, 45, 45, 45, 93, 93,
+#> 93, 93, 93, 93, 4, 4, 4, 4, 4, 4, 4, 93, 4, 4, 4, 5, 5, 4, 4, 86, 96, 38, 102, 102, 102, 102, 102, 102, 102, 66, 125, 66, 66, 66, 66, 66, 66, 66, 93, 93, 93, 93, 93, 93, 93, 93, 117, 117, 35, 35, 35, 93, 93, 93, 93, 93, 5, 5, 5, 5, 5, 5, 38, 38, 114, 114, 30, 30, 30, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 38, 38, 38, 38, 38, 38, 38, 58, 58, 58, 5, 5, 5, 5, 5, 5, 66, 66, 106, 106, 106, 106, 106, 106, 106, 106, 106, 96, 106, 106, 106, 64, 16, 64, 96, 83, 83, 83, 45, 79, 30, 45, 94,
+#> 66, 94, 58, 58, 58, 58, 58, 58, 125, 106, 106, 106, 106, 106, 106, 106, 35, 96, 58, 58, 58, 58, 58, 58, 58, 58, 58, 38, 38, 38, 38, 38, 38, 38, 38, 58, 117, 117, 102, 96, 96, 96, 96, 96, 96, 96, 96, 96, 114, 114, 114, 114, 125, 125, 106, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 45, 45, 45, 45, 131, 131, 131, 114, 114, 93, 131, 4, 116, 66, 116, 30, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 141, 141, 141, 141,
+#> 141, 141, 141, 141, 141, 141, 52, 52, 52, 52, 93, 125, 131, 58, 58, 58, 58, 58, 58, 58, 58, 58, 58, 58, 58, 38, 38, 38, 38, 125, 72, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 35, 35, 35, 35, 94, 94, 94, 94, 94, 94, 94, 94, 131, 131, 131, 131, 131, 131, 64, 96, 96, 96, 96, 96, 96, 96, 96, 96, 30, 30, 30, 30, 16, 96, 45, 45, 45, 45, 141, 66, 30, 38, 30, 66, 125, 117, 117, 117, 117, 117, 117, 86, 117, 86, 86, 86, 86, 86, 86, 79, 86, 125, 35, 35, 117, 117, 117, 16, 16, 16, 16, 16, 93,
+#> 93, 93, 93, 93, 93, 93, 131, 102, 131, 102, 33, 102, 80, 80, 4, 4, 4, 38, 38, 38, 38, 38, 38, 38, 38, 33, 33, 125, 106, 64, 64, 64, 64, 96, 96, 96, 96, 96, 96, 96, 96, 96, 131, 131, 30, 131, 30, 30, 93, 5, 5, 5, 5, 5, 5, 5, 30, 30, 30, 30, 30, 30, 30, 30, 30, 30, 94, 94, 94, 86, 86, 86, 86, 86, 86, 96, 131, 131, 94, 94, 94, 4, 94, 4, 125, 125, 35, 58, 58, 58, 58, 58, 58, 58, 58, 117, 117, 117, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 114,
+#> 117, 117, 117, 117, 117, 4, 4, 4, 4, 102, 102, 102, 35, 35, 35, 35, 116, 58, 58, 58, 58, 66, 66, 66, 66, 66, 66, 134, 134, 134, 134, 93, 134, 64, 64, 96, 96, 96, 96, 96, 96, 96, 96, 96, 83, 83, 83, 83, 83, 35, 35, 35, 35, 35, 35, 35, 96, 96, 96, 96, 5, 93, 93, 35, 93, 35, 4, 4, 4, 4, 4, 4, 4, 4, 117, 117, 117, 117, 117, 117, 117, 117, 52, 52, 52, 52, 52, 4, 117, 117, 117, 117, 117, 117, 117, 125, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 52, 115, 58, 86, 86, 86, 86,
+#> 72, 72, 4, 72, 4, 131, 79, 79, 79, 94, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 114, 114, 114, 114, 114, 64, 64, 64, 64, 64, 96, 96, 96, 96, 96, 96, 96, 64, 64, 64, 96, 96, 96, 96, 96, 96, 96, 93, 93, 93, 93, 93, 58, 58, 58, 38, 38, 38, 38, 38, 38, 38, 38, 38, 66, 66, 66, 30, 30, 30, 30, 30, 72, 72, 72, 4, 4, 93, 72, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 79, 79, 79, 79, 79, 79, 79, 131, 141, 141, 131, 131, 131, 131, 131, 4, 4, 4, 4, 116, 96, 96,
+#> 96, 134, 131, 131, 131, 131, 131, 45, 114, 45, 45, 45, 45, 45, 45, 125, 125, 125, 125, 102, 125, 102, 102, 102, 102, 45, 45, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 38, 38, 38, 38, 38, 38, 38, 93, 93, 106, 106, 106, 106, 106, 106, 33, 131, 131, 131, 116, 116, 116, 33, 33, 33, 33, 33, 33, 106, 72, 72, 72, 72, 72, 4, 4, 4, 30, 96, 96, 96, 96, 96, 96, 96, 96, 96, 114, 114, 114, 114, 83, 83, 83, 83, 131, 35, 35, 35, 117, 117, 106, 117, 106, 106, 106,
+#> 106, 106, 72, 106, 72, 52, 72, 45, 45, 45, 45, 45, 45, 79, 16, 16, 16, 16, 16, 16, 16, 16, 93, 93, 106, 30, 16, 16, 16, 16, 16, 16, 16, 30, 30, 30, 30, 5, 5, 5, 5, 52, 52, 114, 125, 125, 125, 125, 117, 125, 125, 125, 125, 35, 106, 117, 117, 117, 102, 117, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 38, 38, 38, 38, 38, 38, 38, 38, 38, 30, 38, 117, 117, 117, 117, 117, 117, 117, 4, 114, 93, 114, 93, 93, 93, 79, 79, 79, 45, 45, 45, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 114, 114, 114,
+#> 4, 86, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 141, 141, 131, 131, 131, 131, 131, 131, 131, 45, 45, 45, 45, 45, 93, 131, 131, 114, 114, 114, 114, 114, 114, 114, 114, 94, 94, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 33, 33, 33, 33, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 131, 131, 131, 131, 86, 86, 102, 117, 72, 134, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 38, 38, 38, 38, 96, 96, 83, 30, 134, 33, 33, 33, 33, 33, 106, 93, 93, 93, 93, 93,
+#> 93, 114, 114, 114, 114, 35, 93, 117, 131, 96, 96, 116, 125, 125, 125, 125, 125, 125, 125, 125, 66, 66, 4, 4, 4, 117, 117, 38, 117, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 94, 94, 94, 94, 33, 94, 30, 30, 30, 30, 141, 52, 52, 52, 52, 52, 52, 52, 52, 52, 93, 114, 93, 33, 5, 33, 131, 131, 131, 131, 131, 131, 131, 131, 131, 131, 83, 66, 66, 35, 35, 131, 131, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 5, 45, 45, 45, 45, 45, 45, 45, 45, 45, 83, 83, 83, 83, 83, 45, 45, 33,
+#> 33, 33, 33, 33, 33, 33, 72, 72, 72, 72, 72, 72, 93, 93, 93, 30, 93, 30, 30, 30, 96, 93, 93, 93, 93, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 58, 58, 83, 83, 83, 30, 96, 30, 30, 72, 79, 79, 79, 79, 16, 16, 16, 16, 16, 35, 35, 102, 125, 52, 86, 38, 38, 38, 38, 125, 93, 102, 102, 66, 35, 52, 52, 52, 52, 52, 117, 114, 114, 114, 125, 94, 38, 38, 94, 94, 94, 94, 94, 94, 72, 72, 102, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 38, 38, 38, 38, 66,
+#> 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 30, 30, 30, 30, 30, 30, 30, 30, 16, 131, 131, 131, 52, 131, 52, 52, 52, 52, 52, 52, 52, 93, 94, 30, 30, 30, 30, 30, 30, 93, 93, 93, 93, 131, 131, 131, 131, 131, 131, 30, 102, 102, 102, 102, 102, 102, 117, 4, 117, 4, 94, 94, 131, 86, 114, 86, 106, 102, 106, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 30, 30, 30, 30, 30, 30, 30, 66, 66, 38, 38, 38, 38, 38, 38, 38, 38, 38, 93, 93, 93, 93, 4, 93, 4, 4, 38, 38, 38, 116, 116, 66, 66, 66, 66,
+#> 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 16, 16, 16, 16, 131, 131, 131, 93, 116, 30, 30, 30, 30, 30, 5, 66, 134, 134, 66, 66, 66, 66, 66, 66, 30, 52, 52, 116, 116, 116, 116, 116, 4, 4, 4, 4, 4, 4, 4, 4, 72, 72, 72, 72, 72, 72, 72, 72, 117, 96, 96, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 72, 72, 72, 94, 94, 45, 45, 5, 45, 2, 72, 86, 86, 86, 86, 86, 86, 86, 86, 86, 86, 86, 35, 35, 35, 35, 35, 35, 16, 16, 55, 55, 106, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 72, 72, 96, 83, 94,
+#> 102, 102, 102, 102, 79, 79, 79, 79, 79, 83, 83, 83, 83, 83, 94, 94, 94, 94, 94, 30, 30, 30, 30, 30, 30, 30, 30, 58, 58, 58, 58, 58, 58, 58, 58, 58, 131, 131, 131, 131, 131, 16, 16, 16, 16, 16, 16, 16, 30, 30, 30, 30, 30, 5, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 83, 83, 83, 83, 83, 4, 4, 4, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 93, 35, 35, 106, 106, 106, 117, 117, 117, 117, 117, 125, 125, 125, 125, 125, 125, 114, 114, 114, 114, 114, 114, 114, 114, 114, 94, 114, 33, 33,
+#> 33, 33, 93, 93, 93, 93, 93, 93, 131, 131, 66, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 16, 16, 16, 16, 16, 16, 16, 30, 30, 30, 16, 16, 16, 16, 16, 125, 125, 125, 125, 125, 125, 125, 125, 125, 94, 125, 94, 94, 94, 94, 94, 94, 45, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 96, 96, 35, 96, 35, 35, 58, 58, 86, 86, 86, 86, 86, 86, 86, 94, 94, 30, 131, 80, 80, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 93, 93, 45, 4, 45, 134, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52,
+#> 52, 52, 52, 52, 52, 4, 4, 4, 4, 4, 4, 4, 4, 4, 125, 58, 58, 58, 58, 58, 58, 86, 86, 86, 94, 94, 94, 94, 52, 52, 52, 52, 86, 131, 94, 94, 94, 94, 94, 83, 83, 83, 83, 83, 83, 83, 83, 83, 83, 83, 83, 83, 83, 83, 83, 83, 83, 83, 83, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 125, 125, 125, 93, 114, 114, 16, 16, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 134, 134, 134, 134, 5, 5, 35, 35, 35, 35, 35, 125, 125, 125, 125, 4, 4, 4, 16, 16, 16, 16, 16, 16, 83, 83, 83, 83, 83, 83, 83, 83, 83, 83, 83, 45,
+#> 45, 45, 45, 45, 45, 45, 131, 131, 131, 131, 131, 131, 38, 131, 38, 38, 38, 58, 131, 83, 83, 83, 83, 83, 83, 83, 125, 114, 102, 114, 102, 106, 96, 96, 35, 35, 35, 35, 102, 102, 102, 102, 45, 86, 117, 117, 35, 35, 35, 38, 114, 114, 114, 114, 114, 114, 114, 114, 93, 93, 93, 93, 93, 93, 93, 93, 30, 93, 30, 134, 79, 79, 45, 5, 5, 5, 5, 5, 5, 96, 30, 30, 30, 30, 30, 30, 93, 93, 93, 16, 16, 79, 96, 35, 35, 35, 35, 86, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 131, 131, 131, 33, 38, 33,
+#> 83, 102, 83, 45, 79, 79, 79, 79, 79, 79, 45, 45, 45, 134, 134, 134, 134, 134, 134, 96, 96, 96, 72, 72, 72, 72, 134, 134, 72, 72, 72, 72, 72, 45, 45, 35, 45, 35, 35, 35, 35, 35, 35, 35, 5, 5, 125, 83, 83, 83, 83, 83, 83, 66, 66, 66, 66, 125, 125, 125, 125, 125, 131, 131, 94, 94, 86, 86, 86, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 131, 79, 131, 79, 79, 79, 79, 79, 79, 93, 93, 33, 93, 79, 79, 79, 117, 117, 117, 117, 94, 94, 30, 93, 94, 114, 35, 35, 35, 94, 94, 94, 96, 96, 96, 106, 106, 106, 106, 106, 106, 106,
+#> 106, 58, 93, 93, 66, 93, 4, 35, 35, 35, 114, 52, 52, 52, 4, 4, 58, 58, 58, 58, 58, 58, 58, 58, 58, 58, 58, 93, 93, 79, 93, 79, 94, 94, 94, 94, 94, 94, 94, 94, 94, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 117, 117, 33, 35, 35, 35, 33, 33, 5, 5, 5, 96, 96, 96, 96, 96, 96, 96, 96, 96, 96, 52, 102, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 96, 96, 35, 35, 96, 96, 96, 96, 96, 96, 96, 96, 96, 96, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52,
+#> 38, 38, 38, 94, 94, 94, 94, 94, 86, 131, 86, 86, 52, 86, 86, 86, 86, 86, 86, 86, 86, 86, 86, 86, 86, 94, 94, 94, 94, 94, 117, 72, 86, 114, 114, 114, 114, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 125, 125, 117, 45, 45, 45, 72, 72, 72, 72, 72, 79, 131, 93, 93, 93, 93, 93, 93, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 102, 102, 30, 30, 30, 30, 116, 45, 106, 134, 16, 16, 16, 52, 52, 52, 52, 83, 83, 83, 83, 83, 83, 83, 83, 83, 96,
+#> 96, 45, 45, 45, 45, 114, 114, 125, 125, 125, 125, 125, 125, 125, 30, 106, 30, 30, 30, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 58, 125, 58, 45, 45, 134, 134, 134, 93, 93, 93, 93, 93, 4, 83, 93, 16, 16, 93, 94, 86, 125, 125, 131, 131, 45, 131, 45, 45, 106, 106, 106, 106, 106, 131, 38, 38, 38, 38, 38, 38, 38, 38, 38, 102, 38, 102, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 35, 35, 35, 35, 96, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 30, 5, 102, 114, 114, 114, 125,
+#> 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 96, 96, 96, 96, 96, 96, 93, 93, 93, 93, 93, 96, 96, 96, 96, 96, 134, 96, 96, 114, 2, 114, 96, 94, 94, 116, 114, 16, 72, 35, 35, 35, 35, 35, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 131, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 117, 117, 117, 96, 134, 33, 30, 30, 30, 16, 16, 96, 96, 96, 96, 96, 96, 96, 96, 96, 96, 106, 96, 96, 96, 96, 96, 96, 16, 16, 16, 16, 30, 30, 30, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 79, 134, 134, 45, 72, 72, 72, 72,
+#> 72, 72, 72, 72, 72, 72, 72, 125, 125, 125, 125, 125, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 116, 33, 33, 134, 125, 125, 125, 83, 83, 83, 83, 83, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 102, 102, 102, 51, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 72, 72, 72, 72, 72, 72, 72, 72, 93, 93, 93, 33, 33, 96, 93, 93, 134, 134, 134, 134, 134, 134, 134, 4, 86, 5, 5, 5, 5, 5, 5, 5, 5, 5, 30, 30, 30, 30, 30, 30, 125, 125, 35, 35, 35, 35, 35, 35, 35, 35, 38, 125, 106,
+#> 106, 106, 106, 106, 106, 106, 106, 106, 106, 117, 117, 117, 117, 117, 30, 102, 72, 72, 35, 72, 35, 79, 79, 79, 79, 30, 30, 30, 30, 30, 83, 83, 83, 83, 83, 83, 83, 83, 83, 45, 83, 116, 116, 83, 116, 134, 134, 134, 134, 134, 134, 134, 134, 134, 134, 134, 134, 134, 134, 33, 134, 102, 102, 102, 102, 125, 125, 125, 66, 125, 66, 66, 4, 4, 4, 4, 4, 5, 106, 5, 86, 86, 86, 86, 86, 86, 86, 86, 86, 86, 86, 86, 86, 5, 5, 5, 5, 5, 5, 5, 5, 5, 16, 16, 16, 66, 66, 83, 79, 79, 79, 79, 93, 93, 93, 5, 93, 5, 5, 5,
+#> 5, 5, 5, 5, 5, 5, 5, 45, 72, 72, 72, 83, 5, 33, 33, 33, 33, 33, 33, 114, 114, 125, 125, 125, 125, 125, 125, 45, 45, 45, 102, 102, 102, 102, 38, 102, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 106, 106, 106, 106, 106, 106, 106, 125, 125, 125, 16, 16, 16, 16, 45, 45, 45, 33, 58, 125, 125, 125, 125, 125, 125, 125, 125, 96, 125, 117, 117, 117, 117, 16, 125, 125, 125, 125, 38, 38, 38, 38, 38, 38, 58, 58, 58, 94, 94, 94, 5, 52, 106, 117, 117, 117, 117, 102, 102, 30, 102, 106, 93, 93, 33,
+#> 33, 33, 33, 33, 93, 93, 45, 33, 5, 33, 33, 94, 94, 94, 94, 94, 94, 94, 94, 72, 72, 72, 117, 93, 93, 93, 93, 93, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 93, 93, 93, 93, 93, 130, 130, 134, 134, 134, 134, 134, 134, 134, 134, 134, 134, 52, 52, 106, 106, 106, 106, 106, 106, 30, 106, 30, 30, 30, 125, 125, 125, 114, 114, 114, 114, 114, 114, 5, 5, 117, 117, 117, 125, 125, 125, 125, 125, 58, 58, 58, 58, 58, 58, 58, 58, 58, 58, 58, 58, 58, 93, 30, 30, 58, 58, 58, 58, 58, 58, 58, 114, 102, 102, 102, 131,
+#> 83, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 96, 96, 4, 4, 4, 4, 4, 106, 106, 106, 106, 106, 4, 125, 66, 102, 66, 86, 86, 86, 86, 86, 86, 86, 86, 86, 86, 86, 86, 33, 33, 33, 33, 33, 93, 93, 93, 96, 5, 86, 55, 35, 35, 35, 35, 35, 35, 35, 35, 16, 16, 16, 125, 125, 125, 93, 125, 5, 30, 30, 38, 86, 52, 52, 52, 52, 52, 52, 52, 52, 52, 72, 72, 72, 66, 106, 52, 52, 52, 35, 35, 35, 35, 35, 35, 35, 102, 52, 52, 52, 52, 52, 52, 102, 102, 102, 102, 35, 35, 35, 35, 102, 102, 58, 58, 58, 58, 58, 58, 125, 125, 125, 125,
+#> 125, 96, 96, 58, 116, 116, 116, 116, 116, 116, 116, 116, 30, 94, 94, 94, 94, 94, 94, 94, 94, 94, 94, 94, 93, 93, 45, 45, 58, 93, 130, 114, 114, 114, 114, 114, 114, 114, 114, 114, 114, 114, 114, 114, 114, 114, 114, 114, 114, 114, 114, 72, 72, 72, 72, 72, 106, 106, 106, 106, 106, 106, 106, 106, 93, 93, 58, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 114, 114, 114, 52, 114, 52, 5, 5, 117, 66, 66, 66, 66, 66, 66, 66, 66, 94, 94, 94, 51, 94, 16, 16, 16, 16, 30, 30, 30, 30, 30, 30, 52, 52,
+#> 131, 131, 52, 114, 86, 86, 86, 86, 86, 86, 86, 86, 86, 86, 86, 86, 86, 72, 72, 72, 30, 72, 94, 94, 86, 94, 86, 86, 86, 86, 86, 79, 79, 79, 16, 16, 4, 16, 38, 93, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 4, 5, 4, 130, 125, 125, 125, 125, 125, 125, 94, 94, 94, 66, 66, 116, 38, 52, 134, 134, 134, 134, 134, 134, 134, 134, 134, 35, 33, 33, 94, 94, 94, 94, 94, 86, 86, 86, 86, 86, 72, 94, 30, 66, 66, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 131, 96, 131, 96, 96, 5, 5, 5, 33, 5, 33, 5, 5, 45, 5,
+#> 33, 33, 116, 116, 116, 116, 116, 102, 5, 5, 33, 125, 125, 125, 125, 125, 125, 125, 125, 125, 79, 125, 102, 94, 102, 94, 117, 16, 16, 16, 16, 16, 106, 125, 125, 125, 72, 125, 72, 125, 16, 16, 16, 16, 16, 16, 16, 16, 16, 114, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 134, 134, 93, 93, 93, 93, 93, 58, 58, 58, 93, 94, 94, 94, 94, 58, 58, 58, 58, 58, 58, 58, 58, 58, 79, 79, 79, 79, 79, 79, 79, 79, 79, 79, 30, 30, 30, 66, 66, 66, 125, 125, 35, 125, 35, 16, 134, 134, 134, 134, 134, 134, 134, 134,
+#> 93, 134, 93, 93, 93, 79, 79, 79, 79, 79, 79, 79, 79, 79, 79, 79, 79, 134, 134, 134, 134, 134, 134, 134, 134, 114, 114, 94, 134, 38, 93, 45, 134, 134, 78, 134, 35, 35, 35, 35, 35, 35, 35, 4, 35, 4, 4, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 125, 125, 125, 125, 125, 125, 72, 72, 72, 72, 72, 96, 96, 96, 96, 96, 96, 96, 96, 131, 131, 131, 16, 16, 96, 134, 130, 93, 130, 33, 58, 58, 58, 58, 58, 58, 58, 5, 5, 5, 86, 86, 33, 33, 33, 116, 45, 45, 45, 45, 96, 52, 16, 16, 16, 16, 16, 16, 16, 16, 16,
+#> 16, 16, 58, 125, 125, 83, 83, 83, 83, 83, 83, 83, 83, 83, 79, 79, 79, 79, 79, 79, 79, 79, 94, 94, 94, 16, 16, 16, 38, 134, 4, 4, 4, 4, 4, 102, 102, 102, 102, 117, 117, 79, 4, 4, 4, 116, 116, 116, 116, 116, 86, 116, 30, 30, 30, 30, 30, 30, 30, 2, 114, 45, 125, 125, 125, 125, 125, 125, 125, 4, 4, 4, 4, 55, 4, 55, 38, 66, 102, 125, 125, 106, 106, 106, 106, 106, 106, 33, 106, 33, 33, 38, 38, 38, 38, 38, 38, 38, 38, 72, 52, 72, 52, 38, 5, 5, 125, 125, 117, 83, 83, 83, 83, 83, 83, 83, 83, 83, 83, 83, 83,
+#> 83, 83, 83, 134, 134, 134, 79, 79, 79, 72, 58, 58, 58, 58, 117, 117, 117, 117, 117, 117, 117, 83, 117, 116, 116, 96, 96, 96, 96, 96, 96, 96, 96, 96, 96, 96, 96, 125, 125, 125, 125, 125, 114, 114, 114, 114, 114, 114, 114, 55, 55, 38, 102, 134, 134, 35, 38, 117, 117, 117, 66, 106, 117, 52, 52, 52, 52, 52, 93, 93, 93, 93, 93, 5, 51, 102, 102, 102, 102, 102, 102, 94, 102, 72, 72, 66, 72, 38, 52, 52, 66, 134, 134, 134, 134, 134, 134, 134, 134, 134, 134, 134, 134, 93, 93, 93, 93, 5, 5, 4, 4, 4, 4, 4, 4,
+#> 86, 86, 106, 106, 106, 106, 106, 16, 106, 45, 45, 45, 16, 16, 16, 16, 16, 16, 16, 35, 35, 35, 96, 96, 96, 96, 96, 96, 96, 96, 96, 125, 125, 16, 96, 96, 96, 96, 96, 96, 96, 96, 96, 96, 96, 79, 79, 79, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 45, 45, 45, 117, 94, 72, 116, 116, 116, 116, 116, 116, 116, 116, 116, 116, 5, 30, 30, 30, 30, 30, 30, 30, 134, 134, 134, 134, 134, 55, 55, 3, 72, 72, 78, 125, 125, 125, 125, 106, 106, 106, 106, 106, 106, 106, 106, 5, 102, 38, 38, 38, 38, 38, 38, 38, 38,
+#> 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 94, 94, 94, 94, 94, 94, 94, 94, 94, 94, 94, 94, 94, 94, 58, 96, 96, 96, 96, 96, 96, 55, 51, 51, 51, 51, 4, 4, 4, 38, 38, 38, 38, 38, 38, 5, 33, 125, 38, 102, 45, 45, 45, 45, 45, 45, 131, 131, 131, 131, 131, 33, 45, 45, 83, 130, 4, 4, 4, 4, 4, 94, 4, 94, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 86, 86, 86, 86, 86, 86, 86, 125, 51, 51, 51, 51, 51, 4, 4, 117, 131, 86, 117, 2, 33, 106, 106, 106, 106, 106, 106, 94, 94, 94, 5, 94, 5, 55, 55, 72, 94, 4,
+#> 125, 94, 94, 94, 83, 83, 72, 72, 38, 72, 93, 93, 93, 116, 116, 131, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 16, 134, 134, 134, 134, 134, 134, 134, 134, 134, 134, 134, 134, 4, 5, 72, 72, 72, 72, 131, 131, 102, 131, 96, 102, 96, 96, 96, 96, 96, 96, 134, 134, 96, 117, 117, 117, 117, 117, 117, 117, 117, 131, 131, 131, 131, 131, 5, 5, 125, 66, 66, 66, 66, 66, 38, 38, 38, 35, 35, 106, 102, 102, 125, 125, 114, 125, 114, 114, 114, 114, 94, 94, 94, 94, 94, 66, 66, 94, 66,
+#> 66, 66, 66, 66, 33, 33, 30, 102, 102, 117, 117, 117, 117, 114, 117, 114, 114, 66, 66, 4, 66, 102, 114, 114, 83, 94, 94, 94, 94, 94, 94, 94, 94, 86, 94, 96, 96, 96, 96, 96, 114, 114, 114, 114, 114, 114, 117, 117, 117, 94, 94, 114, 117, 117, 117, 117, 117, 116, 38, 38, 16, 38, 45, 96, 38, 38, 131, 131, 131, 131, 131, 131, 131, 96, 131, 16, 16, 45, 131, 131, 5, 5, 5, 5, 5, 5, 4, 45, 66, 52, 58, 66, 79, 3, 3, 72, 72, 35, 35, 35, 35, 30, 38, 38, 4, 5, 130, 134, 134, 134, 134, 134, 114, 114, 4, 114, 4,
+#> 4, 4, 4, 130, 130, 130, 35, 130, 35, 72, 130, 96, 96, 96, 96, 5, 5, 5, 52, 52, 52, 52, 131, 131, 131, 131, 131, 131, 131, 131, 131, 96, 131, 96, 96, 93, 96, 52, 93, 38, 134, 33, 131, 131, 116, 93, 131, 93, 93, 79, 52, 52, 52, 94, 94, 94, 94, 94, 94, 94, 94, 94, 51, 35, 58, 58, 58, 58, 58, 58, 58, 58, 58, 58, 58, 58, 58, 58, 58, 58, 58, 58, 58, 58, 30, 30, 30, 30, 30, 30, 30, 30, 30, 30, 30, 2, 2, 2, 45, 45, 45, 125, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 117, 35, 106, 45, 117, 94, 125, 125,
+#> 117, 117, 35, 35, 58, 58, 58, 58, 106, 38, 38, 16, 38, 16, 16, 102, 131, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 96, 96, 96, 96, 96, 96, 96, 93, 106, 106, 106, 106, 106, 106, 58, 58, 58, 58, 33, 5, 134, 134, 134, 134, 134, 134, 134, 134, 134, 30, 114, 114, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 33, 33, 51, 33, 33, 131, 33, 72, 94, 16, 16, 16, 16, 16, 16, 33, 51, 51, 51, 51, 51, 117, 117, 117, 45, 45, 45, 16, 116, 116, 116, 116, 116, 116, 116, 116, 116, 116, 116, 38, 38, 38, 38, 38, 38, 38, 38,
+#> 33, 38, 116, 116, 106, 106, 106, 106, 106, 106, 106, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 35, 35, 35, 35, 35, 35, 35, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 35, 35, 35, 72, 114, 72, 114, 72, 72, 72, 106, 106, 106, 106, 106, 106, 4, 4, 4, 58, 38, 38, 38, 38, 38, 38, 33, 83, 94, 94, 94, 94, 94, 38, 38, 114, 35, 35, 35, 5, 5, 114, 134, 33, 33, 33, 33, 33, 33, 33, 33, 102, 116, 4, 4, 4, 4, 4, 4, 4, 4, 45, 45, 45, 45, 93, 93, 96, 134, 134, 134, 134, 52, 52, 52, 52, 52,
+#> 52, 52, 93, 93, 2, 45, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 45, 3, 3, 3, 3, 3, 3, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 93, 96, 96, 96, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 94, 94, 94, 94, 94, 4, 114, 114, 114, 134, 134, 134, 134, 134, 5, 5, 5, 45, 45, 45, 94, 33, 94, 3, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 94, 94, 94, 93, 72, 93, 72, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 83, 83, 83, 83, 83,
+#> 83, 83, 83, 83, 83, 83, 79, 79, 79, 79, 79, 79, 79, 79, 79, 79, 79, 79, 79, 79, 4, 4, 4, 4, 4, 4, 4, 16, 16, 38, 52, 30, 30, 30, 30, 30, 30, 55, 55, 55, 79, 79, 79, 79, 79, 79, 79, 93, 93, 93, 93, 66, 58, 58, 58, 58, 58, 58, 58, 58, 58, 58, 58, 58, 58, 58, 58, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 96, 134, 96, 134, 35, 45, 45, 45, 45, 45, 45, 114, 134, 134, 134, 134, 134, 134, 134, 5, 117, 4, 4, 4, 4, 4, 4, 4, 38, 125, 125, 125, 102, 2, 102, 51, 96, 114, 96, 30, 30, 30,
+#> 30, 93, 93, 30, 33, 30, 33, 78, 131, 131, 131, 131, 131, 131, 131, 131, 131, 131, 131, 131, 55, 52, 52, 52, 52, 52, 93, 58, 131, 137, 137, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 3, 3, 3, 106, 106, 106, 106, 106, 106, 66, 66, 30, 66, 86, 86, 86, 86, 86, 86, 51, 51, 51, 51, 51, 51, 51, 51, 51, 51, 125, 125, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 16, 125, 83, 83, 83, 83, 83, 58, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 35, 96, 116, 116, 116, 116, 116, 116, 116,
+#> 116, 116, 116, 116, 116, 116, 116, 116, 116, 116, 116, 131, 131, 131, 131, 131, 131, 131, 131, 131, 131, 131, 52, 45, 131, 131, 66, 45, 52, 52, 52, 52, 52, 52, 52, 52, 45, 45, 45, 45, 45, 83, 83, 83, 83, 114, 55, 114, 55, 55, 55, 55, 55, 72, 72, 72, 72, 4, 4, 93, 93, 93, 52, 52, 94, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 55, 102, 116, 116, 116, 116, 66, 116, 72, 72, 5, 5, 5, 5, 5, 5, 4, 33, 5, 131, 72, 33, 33, 33, 33, 33, 33, 33, 93, 45, 45, 2, 2, 83, 45, 45, 45, 45, 45,
+#> 45, 58, 58, 102, 5, 35, 83, 83, 45, 78, 96, 96, 134, 134, 134, 134, 134, 134, 134, 58, 66, 30, 33, 125, 45, 45, 45, 134, 116, 116, 116, 79, 116, 116, 58, 45, 45, 45, 45, 45, 4, 45, 45, 45, 45, 33, 117, 35, 106, 93, 102, 72, 45, 131, 116, 116, 116, 116, 116, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 117, 117, 117, 117, 131, 33, 33, 134, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 117, 58, 117, 51, 51, 51, 86, 86, 86, 86, 86, 86, 4, 4, 45, 78, 78,
+#> 78, 72, 72, 117, 117, 117, 45, 45, 45, 106, 106, 106, 106, 106, 106, 106, 106, 66, 3, 3, 3, 3, 3, 94, 134, 134, 134, 134, 134, 134, 134, 134, 94, 94, 94, 116, 116, 116, 116, 93, 116, 16, 5, 5, 5, 58, 102, 102, 102, 102, 102, 102, 102, 102, 3, 102, 3, 3, 3, 16, 16, 16, 16, 38, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 30, 30, 30, 30, 30, 2, 2, 2, 2, 2, 2, 2, 2, 71, 72, 72, 72, 72, 72, 72, 55, 72, 94, 94, 94, 94, 94, 94, 94, 94, 114, 96, 45, 45, 45, 45, 45, 45, 45, 94, 94, 94, 45, 114, 16, 3,
+#> 3, 137, 131, 131, 131, 131, 131, 131, 93, 93, 93, 93, 16, 16, 93, 16, 134, 16, 16, 96, 45, 45, 45, 45, 45, 45, 45, 45, 33, 33, 5, 5, 94, 94, 94, 94, 94, 102, 102, 102, 102, 102, 102, 102, 102, 66, 94, 94, 94, 94, 94, 94, 134, 66, 66, 93, 134, 93, 93, 93, 93, 93, 16, 94, 96, 117, 117, 117, 117, 38, 117, 33, 33, 72, 16, 16, 16, 16, 35, 117, 117, 117, 117, 117, 117, 117, 35, 16, 35, 16, 16, 114, 114, 66, 66, 66, 66, 52, 78, 72, 72, 72, 72, 72, 72, 72, 134, 134, 93, 134, 3, 93, 2, 106, 4, 86, 106, 86,
+#> 86, 86, 86, 86, 55, 58, 58, 58, 35, 35, 35, 117, 117, 94, 94, 79, 79, 79, 79, 58, 58, 58, 58, 58, 117, 38, 117, 38, 102, 102, 16, 86, 86, 86, 86, 16, 16, 33, 45, 45, 106, 45, 45, 86, 86, 55, 137, 66, 66, 55, 55, 55, 55, 55, 66, 5, 5, 5, 5, 5, 55, 55, 55, 5, 102, 38, 94, 86, 86, 116, 116, 116, 116, 116, 116, 116, 116, 116, 58, 116, 3, 3, 3, 3, 3, 3, 93, 93, 3, 3, 117, 93, 30, 30, 30, 30, 117, 117, 117, 117, 117, 117, 117, 117, 117, 16, 117, 58, 58, 58, 58, 58, 58, 58, 58, 114, 114, 114, 114, 58, 58,
+#> 4, 131, 55, 55, 55, 55, 55, 72, 5, 5, 33, 55, 55, 51, 51, 130, 5, 5, 58, 58, 58, 58, 114, 114, 114, 114, 3, 3, 3, 3, 3, 3, 72, 71, 117, 51, 16, 16, 16, 16, 16, 16, 16, 16, 2, 2, 94, 94, 5, 5, 5, 5, 45, 45, 45, 45, 45, 45, 45, 117, 116, 116, 102, 102, 102, 106, 106, 51, 52, 102, 131, 131, 131, 134, 134, 134, 134, 134, 134, 134, 134, 131, 131, 125, 79, 79, 79, 79, 79, 134, 45, 5, 5, 72, 72, 72, 72, 94, 78, 52, 16, 72, 72, 72, 130, 66, 45, 45, 45, 45, 45, 45, 45, 45, 16, 16, 16, 16, 16, 16, 16, 16,
+#> 72, 72, 33, 72, 130, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 94, 4, 4, 51, 51, 51, 51, 51, 51, 51, 130, 58, 130, 4, 4, 51, 137, 51, 114, 30, 30, 30, 83, 83, 51, 51, 51, 51, 51, 51, 51, 16, 38, 16, 33, 131, 33, 33, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 5, 131, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45, 102, 102, 102, 33, 33, 33, 33, 72, 79, 45, 79, 5, 102, 30, 30, 30, 30, 2, 2, 2, 125, 125, 125, 125, 125, 125, 125, 125, 35, 114, 38, 78, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 93, 93, 93,
+#> 93, 93, 93, 93, 93, 94, 94, 94, 38, 38, 38, 38, 16, 58, 106, 16, 16, 38, 38, 38, 38, 38, 38, 38, 38, 114, 4, 3, 117, 106, 125, 125, 66, 66, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 4, 4, 4, 45, 45, 45, 45, 117, 117, 117, 72, 72, 72, 72, 72, 94, 72, 72, 134, 134, 134, 134, 134, 134, 134, 134, 134, 125, 5, 5, 5, 134, 93, 93, 116, 116, 116, 116, 116, 116, 116, 116, 116, 116, 116, 116, 116, 116, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 5, 5, 5, 16, 72, 72, 72, 86, 86, 86, 93, 93, 131,
+#> 131, 131, 131, 117, 117, 117, 117, 117, 117, 38, 38, 38, 38, 125, 102, 102, 131, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 72, 72, 72, 72, 72, 51, 72, 51, 51, 131, 55, 35, 4, 35, 38, 45, 116, 116, 116, 116, 116, 116, 116, 131, 131, 131, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 72, 51, 51, 51, 51, 51, 72, 72, 72, 35, 35, 78, 78, 117, 131, 114, 114, 131, 93, 93, 93, 93, 93, 93, 93, 93, 93, 58, 58, 58, 93, 93, 93, 93, 93, 93, 93, 93, 93, 134, 134, 134, 134, 134,
+#> 134, 134, 55, 55, 94, 94, 94, 94, 94, 94, 94, 55, 93, 55, 114, 114, 114, 114, 114, 114, 114, 114, 114, 114, 114, 114, 114, 114, 114, 114, 78, 78, 72, 72, 86, 86, 86, 86, 16, 16, 16, 16, 16, 16, 16, 94, 94, 94, 94, 102, 35, 35, 35, 131, 131, 131, 131, 131, 5, 5, 5, 5, 5, 131, 131, 131, 131, 131, 5, 5, 94, 94, 94, 94, 94, 94, 94, 130, 35, 55, 55, 55, 55, 117, 117, 117, 117, 86, 86, 137, 3, 137, 3, 51, 79, 94, 137, 137, 137, 4, 78, 45, 45, 45, 86, 86, 33, 86, 38, 38, 38, 72, 72, 72, 72, 16, 16, 16,
+#> 16, 16, 16, 16, 16, 16, 35, 35, 72, 72, 72, 96, 102, 102, 102, 102, 102, 102, 102, 125, 125, 125, 125, 125, 125, 134, 38, 134, 38, 38, 38, 116, 116, 116, 116, 116, 116, 93, 93, 93, 93, 93, 93, 125, 125, 130, 93, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 35, 35, 79, 106, 106, 106, 106, 4, 106, 4, 4, 38, 38, 93, 51, 51, 51, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 134, 134, 134, 134, 134, 134, 52, 52, 38, 52, 5, 93, 93, 134, 134, 33, 93, 93, 114, 16, 16, 114, 72, 114, 96,
+#> 96, 96, 96, 96, 96, 96, 93, 93, 93, 93, 116, 116, 38, 38, 38, 38, 38, 4, 114, 116, 116, 116, 116, 79, 116, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 72, 131, 33, 93, 93, 93, 93, 93, 93, 116, 114, 114, 114, 114, 93, 114, 93, 93, 125, 114, 66, 66, 66, 66, 66, 66, 66, 66, 16, 16, 16, 16, 35, 35, 58, 33, 93, 93, 102, 102, 102, 3, 96, 96, 96, 96, 130, 130, 130, 35, 78, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 45, 45, 93, 35, 35, 30, 30, 30, 30, 30, 52, 52, 52, 52, 52, 52, 52, 130, 55, 55, 3, 94, 94, 131,
+#> 131, 131, 131, 131, 131, 131, 66, 131, 66, 52, 52, 52, 52, 52, 83, 83, 83, 83, 83, 83, 83, 83, 114, 114, 114, 38, 130, 130, 130, 51, 131, 131, 131, 131, 131, 131, 131, 131, 5, 55, 55, 114, 72, 72, 72, 72, 72, 93, 93, 93, 93, 93, 93, 93, 93, 33, 3, 94, 94, 134, 134, 134, 134, 134, 134, 134, 72, 72, 72, 72, 72, 3, 3, 94, 94, 38, 38, 38, 38, 38, 106, 106, 16, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 72, 45, 38, 38, 38, 38, 38, 38, 38, 38, 52, 106, 52, 16, 4, 4, 4, 4, 4, 4, 4,
+#> 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 45, 78, 4, 4, 58, 58, 58, 58, 58, 58, 58, 58, 58, 102, 102, 94, 94, 94, 16, 94, 4, 66, 66, 66, 66, 66, 66, 58, 66, 94, 94, 94, 94, 94, 94, 94, 117, 125, 125, 93, 93, 38, 38, 38, 38, 16, 38, 16, 35, 35, 114, 5, 134, 134, 134, 134, 134, 134, 134, 134, 134, 134, 134, 134, 55, 94, 94, 94, 94, 94, 94, 94, 94, 94, 94, 94, 94, 117, 117, 117, 71, 134, 86, 86, 86, 86, 86, 86, 86, 86, 2, 71, 71, 71, 71, 71, 131, 5, 116, 58, 58, 58, 58, 58, 58, 94, 51,
+#> 51, 4, 4, 4, 4, 58, 3, 35, 35, 35, 131, 131, 125, 5, 5, 5, 16, 116, 116, 116, 116, 116, 116, 116, 116, 116, 116, 102, 116, 102, 102, 102, 102, 51, 52, 52, 52, 58, 58, 58, 58, 52, 58, 52, 66, 72, 66, 94, 86, 86, 86, 86, 86, 86, 16, 86, 16, 55, 131, 52, 52, 102, 134, 134, 134, 134, 134, 134, 134, 96, 125, 125, 125, 131, 3, 3, 3, 4, 66, 66, 66, 66, 66, 96, 96, 96, 96, 33, 33, 33, 33, 33, 30, 2, 2, 2, 2, 2, 2, 2, 2, 71, 71, 33, 58, 58, 131, 131, 131, 131, 131, 131, 131, 93, 93, 96, 94, 96, 131, 131,
+#> 131, 79, 131, 131, 52, 52, 52, 83, 83, 83, 83, 78, 134, 125, 125, 125, 125, 125, 117, 117, 51, 51, 51, 51, 51, 51, 66, 66, 117, 35, 117, 35, 35, 52, 52, 51, 51, 51, 51, 51, 51, 51, 51, 51, 51, 51, 51, 51, 51, 51, 51, 51, 96, 96, 96, 96, 96, 96, 96, 93, 93, 93, 93, 93, 93, 93, 51, 96, 51, 51, 51, 45, 45, 94, 134, 94, 94, 94, 45, 94, 117, 117, 117, 117, 117, 117, 58, 58, 72, 72, 72, 72, 58, 58, 58, 58, 52, 52, 52, 52, 52, 79, 51, 16, 51, 38, 102, 55, 52, 52, 52, 55, 55, 55, 55, 55, 35, 35, 4, 55, 131,
+#> 102, 116, 116, 116, 116, 4, 4, 4, 4, 4, 4, 72, 72, 72, 72, 72, 72, 125, 125, 76, 2, 2, 2, 2, 2, 2, 2, 3, 134, 134, 125, 125, 4, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 93, 33, 33, 33, 33, 33, 33, 33, 33, 52, 52, 52, 52, 52, 52, 52, 55, 55, 55, 125, 125, 125, 125, 125, 125, 16, 4, 4, 52, 117, 117, 38, 79, 79, 79, 79, 79, 79, 16, 79, 94, 66, 93, 106, 72, 96, 96, 96, 96, 96, 96, 96, 96, 96, 96, 96, 96, 96, 93, 93, 3, 3, 33, 33, 33, 33, 38, 116, 116, 116, 116, 94, 94, 114, 114,
+#> 78, 78, 16, 16, 55, 79, 79, 79, 79, 79, 79, 79, 79, 79, 79, 79, 71, 71, 71, 71, 71, 52, 52, 79, 116, 116, 116, 116, 116, 116, 116, 116, 116, 116, 116, 93, 116, 93, 93, 76, 116, 94, 83, 83, 83, 78, 78, 125, 125, 125, 125, 52, 114, 114, 114, 52, 114, 58, 58, 52, 52, 58, 58, 58, 58, 58, 58, 58, 58, 72, 72, 86, 86, 86, 86, 86, 86, 86, 16, 86, 71, 71, 71, 33, 79, 96, 38, 45, 117, 51, 51, 55, 55, 55, 72, 3, 3, 3, 3, 78, 3, 3, 78, 78, 78, 78, 78, 5, 5, 5, 5, 5, 94, 94, 94, 94, 93, 94, 116, 55, 117, 117,
+#> 55, 117, 134, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 71, 71, 71, 71, 58, 58, 58, 58, 58, 35, 58, 35, 58, 52, 3, 3, 3, 3, 3, 3, 3, 3, 72, 55, 117, 117, 117, 117, 117, 117, 117, 117, 117, 114, 116, 38, 38, 117, 117, 117, 96, 96, 96, 96, 96, 125, 125, 125, 125, 55, 131, 55, 55, 55, 55, 117, 117, 117, 117, 117, 125, 2, 2, 2, 2, 2, 71, 71, 125, 125, 96, 137, 116, 72, 72, 72, 72, 30, 30, 30, 114, 114, 94, 114, 94, 116, 96, 96, 96, 96, 96, 96, 96, 117, 117, 117, 117, 117, 117, 117, 96, 2,
+#> 2, 2, 2, 2, 2, 2, 71, 134, 117, 117, 117, 117, 131, 45, 38, 45, 38, 38, 38, 38, 38, 38, 38, 38, 94, 45, 96, 96, 96, 96, 96, 96, 96, 5, 5, 5, 5, 58, 58, 5, 114, 117, 66, 134, 134, 134, 96, 33, 33, 55, 134, 134, 134, 134, 16, 134, 16, 130, 93, 106, 4, 4, 4, 3, 51, 51, 51, 51, 51, 51, 58, 131, 131, 93, 93, 93, 93, 93, 131, 131, 137, 35, 35, 35, 35, 35, 35, 35, 93, 93, 30, 30, 30, 2, 2, 2, 2, 2, 2, 2, 2, 71, 71, 71, 71, 4, 72, 16, 116, 16, 16, 16, 16, 16, 16, 16, 72, 72, 72, 72, 4, 4, 4, 45, 93, 131,
+#> 55, 55, 55, 55, 55, 16, 16, 16, 16, 16, 16, 16, 72, 72, 72, 134, 134, 134, 134, 134, 134, 134, 134, 134, 134, 134, 134, 102, 102, 102, 102, 72, 72, 72, 72, 72, 72, 72, 72, 16, 131, 78, 114, 55, 55, 55, 55, 55, 55, 35, 35, 35, 35, 35, 35, 4, 35, 5, 106, 55, 55, 55, 55, 55, 55, 55, 55, 55, 55, 79, 79, 94, 94, 94, 94, 116, 134, 134, 134, 134, 134, 134, 117, 130, 3, 16, 72, 72, 114, 58, 33, 117, 33, 33, 33, 33, 33, 96, 16, 16, 16, 96, 66, 66, 66, 66, 66, 66, 66, 72, 93, 94, 55, 55, 55, 55, 55, 52, 52,
+#> 3, 52, 38, 117, 117, 117, 117, 117, 35, 35, 117, 16, 16, 16, 72, 134, 134, 134, 134, 134, 134, 134, 134, 134, 134, 134, 134, 71, 71, 93, 86, 86, 86, 86, 86, 86, 86, 86, 137, 137, 116, 116, 93, 55, 55, 55, 55, 55, 55, 55, 16, 16, 16, 16, 16, 4, 4, 4, 4, 4, 4, 114, 102, 102, 102, 102, 102, 102, 102, 102, 72, 58, 114, 72, 78, 78, 5, 78, 76, 52, 79, 79, 79, 79, 79, 79, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 79, 79, 79, 79, 79, 79, 79, 79, 94, 94, 94, 94, 134, 72, 72, 72, 72, 35, 72, 35,
+#> 106, 125, 5, 5, 5, 78, 137, 38, 96, 96, 96, 96, 96, 96, 96, 3, 106, 106, 114, 106, 106, 106, 106, 16, 106, 16, 94, 94, 94, 116, 131, 131, 131, 131, 4, 131, 4, 71, 93, 93, 93, 93, 93, 93, 93, 94, 5, 94, 5, 5, 5, 5, 5, 5, 5, 5, 5, 51, 3, 45, 45, 45, 45, 45, 45, 45, 16, 45, 16, 52, 52, 52, 52, 83, 83, 83, 78, 78, 78, 78, 58, 78, 114, 114, 114, 16, 58, 58, 72, 72, 72, 72, 72, 72, 72, 72, 116, 116, 116, 116, 116, 16, 131, 131, 131, 131, 131, 102, 102, 4, 4, 4, 3, 78, 137, 58, 58, 102, 102, 102, 102, 102,
+#> 102, 102, 102, 93, 102, 93, 93, 71, 71, 71, 71, 72, 94, 106, 106, 106, 106, 106, 106, 106, 106, 106, 116, 116, 4, 116, 4, 72, 38, 72, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 125, 125, 125, 125, 125, 125, 4, 72, 72, 16, 16, 16, 16, 16, 4, 4, 106, 106, 106, 106, 106, 106, 117, 117, 117, 117, 117, 117, 72, 72, 117, 117, 117, 117, 79, 79, 79, 79, 79, 79, 79, 131, 131, 52, 52, 45, 45, 45, 45, 45, 45, 86, 33, 2, 71, 71, 71, 16, 33, 93, 96, 96, 94, 94, 134, 134, 134, 134, 134, 134,
+#> 125, 125, 125, 125, 125, 125, 125, 125, 125, 134, 134, 134, 134, 3, 3, 3, 72, 79, 114, 33, 114, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 58, 58, 58, 58, 58, 58, 58, 58, 58, 58, 102, 102, 131, 51, 86, 86, 137, 137, 137, 137, 116, 96, 96, 96, 96, 51, 51, 51, 114, 114, 71, 114, 71, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 58, 58, 58, 58, 58, 58, 58, 114, 93, 86, 86, 86, 86, 86, 86, 35, 35, 35, 35, 114, 114, 134, 55, 55, 55, 55, 55, 52, 52, 52, 52, 52, 52, 52, 52,
+#> 33, 33, 33, 33, 33, 33, 78, 78, 131, 58, 58, 58, 58, 58, 58, 76, 4, 4, 4, 4, 125, 125, 125, 35, 35, 51, 137, 3, 137, 79, 114, 114, 38, 134, 134, 38, 38, 38, 38, 137, 137, 125, 137, 3, 78, 16, 125, 78, 130, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 93, 66, 66, 66, 66, 66, 66, 96, 16, 16, 16, 16, 93, 93, 93, 93, 52, 130, 45, 131, 131, 131, 131, 131, 131, 131, 131, 131, 131, 131, 131, 131, 72, 102, 72, 72, 72, 72, 72, 72, 55, 72, 55, 94, 94, 55, 137, 125, 125, 125, 125, 102, 125, 102, 102, 52, 102, 52,
+#> 52, 52, 52, 102, 102, 102, 76, 2, 2, 2, 2, 125, 125, 125, 3, 134, 114, 114, 22, 22, 64, 5, 5, 5, 5, 5, 5, 5, 5, 52, 96, 4, 72, 3, 3, 3, 3, 3, 3, 3, 86, 86, 86, 72, 86, 72, 72, 72, 72, 35, 35, 125, 66, 66, 66, 45, 79, 79, 79, 79, 79, 79, 79, 79, 79, 79, 79, 106, 51, 51, 16, 16, 16, 3, 66, 66, 66, 66, 66, 16, 106, 125, 125, 125, 78, 78, 78, 78, 125, 114, 2, 2, 2, 71, 71, 71, 71, 94, 94, 78, 94, 78, 5, 78, 78, 78, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 16, 55, 55, 55, 55, 55, 55, 72, 76, 72, 72,
+#> 16, 93, 93, 93, 93, 93, 93, 93, 93, 93, 116, 116, 33, 33, 33, 33, 33, 33, 33, 33, 33, 79, 79, 79, 79, 79, 79, 79, 79, 79, 79, 79, 79, 79, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 72, 102, 4, 4, 4, 4, 4, 4, 4, 4, 4, 93, 93, 51, 51, 51, 51, 51, 96, 125, 125, 125, 125, 125, 125, 125, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 35, 76, 94, 94, 94, 94, 94, 94, 94, 94, 94, 76, 134, 134, 51, 134, 94, 94, 94, 94, 94, 94, 94, 94, 94, 94, 94, 94, 58, 58, 58, 58, 58, 58, 58, 58, 58, 58, 58, 58,
+#> 93, 125, 125, 131, 16, 16, 16, 16, 16, 16, 16, 102, 102, 102, 102, 137, 131, 52, 96, 52, 52, 52, 16, 130, 130, 130, 130, 35, 130, 58, 66, 131, 125, 125, 38, 38, 38, 38, 52, 52, 52, 52, 52, 137, 137, 45, 45, 45, 45, 45, 45, 45, 45, 78, 93, 93, 93, 93, 93, 93, 93, 114, 114, 114, 114, 114, 114, 114, 33, 114, 33, 33, 33, 16, 33, 16, 117, 117, 16, 16, 16, 16, 16, 16, 16, 16, 16, 33, 93, 45, 45, 45, 45, 45, 45, 45, 45, 16, 102, 102, 130, 72, 72, 72, 72, 72, 93, 93, 106, 106, 134, 4, 4, 4, 4, 4, 94, 94,
+#> 131, 66, 66, 66, 117, 114, 102, 33, 33, 33, 33, 33, 102, 102, 117, 117, 117, 117, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 72, 78, 78, 78, 78, 78, 78, 78, 52, 52, 131, 131, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 66, 96, 116, 102, 116, 134, 134, 134, 134, 134, 134, 116, 134, 116, 5, 5, 125, 125, 102, 125, 16, 16, 16, 16, 16, 16, 116, 116, 116, 116, 116, 116, 94, 33, 3, 3, 3, 3, 3, 3, 3, 3, 3, 58, 58, 52, 52, 52, 52, 94, 16, 16, 16, 16, 16, 16, 16, 16, 16,
+#> 16, 78, 78, 78, 78, 78, 78, 78, 78, 78, 3, 3, 38, 38, 38, 3, 114, 5, 4, 4, 93, 93, 35, 35, 35, 35, 35, 130, 55, 45, 45, 79, 79, 130, 130, 130, 35, 35, 35, 131, 78, 78, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 131, 45, 45, 45, 45, 45, 45, 45, 45, 102, 116, 131, 102, 102, 102, 102, 58, 58, 58, 58, 58, 58, 102, 102, 102, 102, 137, 117, 117, 117, 117, 117, 117, 117, 117, 117, 131, 131, 114, 114, 114, 114, 114, 16, 16, 72, 72, 72, 72, 45, 45, 45, 45, 38, 38, 38, 38, 38, 38, 38, 38, 38, 38, 125,
+#> 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 106, 106, 106, 106, 4, 106, 4, 4, 5, 106, 5, 137, 114, 102, 102, 102, 102, 102, 102, 102, 72, 102, 16, 16, 16, 71, 106, 106, 106, 106, 106, 35, 106, 35, 35, 35, 35, 35, 35, 35, 35, 78, 78, 78, 78, 106, 16, 16, 16, 16, 16, 16, 16, 16, 16, 96, 35, 130, 130, 130, 130, 130, 130, 130, 130, 35, 35, 35, 35, 35, 35, 35, 35, 131, 131, 96, 131, 33, 130, 130, 130, 130, 130, 130, 58, 130, 5, 5, 5, 52, 117, 117, 117, 38, 131, 131, 131, 131, 131, 71, 71, 131,
+#> 3, 3, 33, 33, 33, 33, 114, 114, 114, 131, 45, 131, 45, 45, 125, 125, 125, 114, 125, 106, 114, 38, 38, 38, 130, 130, 130, 130, 130, 130, 130, 130, 130, 16, 16, 72, 72, 72, 134, 134, 134, 134, 134, 134, 3, 134, 3, 3, 3, 3, 35, 16, 66, 66, 66, 66, 66, 66, 66, 78, 71, 78, 72, 72, 72, 116, 116, 5, 5, 5, 5, 5, 5, 5, 5, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 33, 76, 134, 134, 134, 137, 137, 137, 137, 137, 137, 137, 137, 137, 137, 137, 102, 102, 58, 58, 58, 4, 58, 4, 45, 45, 4, 45, 72, 72, 72, 72, 72,
+#> 72, 72, 72, 72, 114, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 66, 66, 66, 66, 66, 33, 33, 134, 94, 94, 94, 114, 114, 114, 114, 114, 76, 3, 130, 96, 96, 96, 16, 16, 93, 55, 55, 55, 76, 76, 35, 35, 134, 134, 134, 134, 134, 134, 134, 134, 134, 78, 72, 72, 72, 72, 72, 72, 72, 72, 72, 72, 116, 116, 116, 116, 116, 116, 38, 102, 125, 125, 125, 125, 125, 93, 93, 93, 93, 93, 93, 93, 71, 96, 130, 79, 79, 79, 79, 79, 79, 33, 79, 106, 106, 106, 96, 96, 96, 96, 96, 96, 4, 4, 4, 4, 4, 4, 4, 4, 4, 117,
+#> 117, 116, 116, 116, 116, 116, 116, 116, 116, 116, 116, 116, 45, 45, 45, 45, 116, 116, 116, 116, 116, 116, 96, 51, 51, 51, 51, 51, 51, 51, 106, 106, 106, 16, 16, 16, 38, 38, 38, 38, 38, 38, 38, 38, 3, 51, 51, 51, 51, 51, 51, 51, 51, 51, 51, 134, 5, 66, 106, 130, 106, 106, 106, 106, 134, 134, 134, 134, 134, 134, 134, 134, 38, 38, 38, 38, 38, 38, 38, 38, 38, 52, 72, 38, 55, 72, 55, 55, 55, 55, 117, 117, 16, 3, 3, 96, 106, 106, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 116,
+#> 116, 116, 116, 116, 4, 4, 4, 130, 93, 93, 137, 137, 35, 131, 131, 131, 131, 131, 131, 52, 131, 117, 117, 117, 117, 117, 117, 117, 33, 33, 33, 33, 33, 33, 33, 33, 55, 55, 55, 55, 55, 4, 4, 4, 4, 117, 137, 78, 78, 78, 78, 78, 78, 78, 78, 131, 78, 131, 131, 131, 131, 131, 131, 131, 131, 5, 116, 125, 125, 125, 125, 125, 71, 71, 16, 16, 16, 16, 16, 16, 16, 93, 93, 72, 72, 72, 72, 72, 72, 72, 72, 5, 5, 5, 5, 5, 5, 5, 66, 66, 66, 66, 66, 66, 66, 66, 66, 5, 5, 5, 5, 5, 5, 5, 5, 5, 4, 71, 71, 71, 71, 71,
+#> 71, 71, 71, 71, 71, 3, 3, 3, 3, 3, 3, 78, 5, 78, 66, 66, 66, 66, 66, 66, 66, 66, 96, 78, 78, 78, 78, 78, 125, 45, 106, 51, 130, 130, 130, 130, 130, 3, 4, 4, 4, 4, 4, 114, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 52, 93, 93, 93, 93, 94, 94, 45, 45, 45, 45, 45, 45, 45, 45, 137, 130, 3, 3, 3, 3, 3, 3, 4, 4, 114, 33, 3, 33, 3, 3, 3, 3, 130, 130, 79, 79, 79, 52, 79, 52, 102, 130, 5, 5, 93, 93, 93, 93, 93, 4, 66, 117, 134, 134, 33, 117, 117, 117, 117, 117, 117, 117, 16, 131, 131, 131, 131, 131,
+#> 116, 79, 94, 94, 94, 134, 134, 134, 52, 52, 52, 52, 52, 52, 52, 71, 71, 130, 130, 116, 35, 116, 130, 130, 130, 130, 130, 130, 52, 130, 52, 134, 16, 16, 16, 96, 96, 96, 96, 78, 78, 78, 78, 78, 79, 5, 5, 5, 5, 5, 4, 4, 4, 106, 106, 4, 16, 106, 3, 137, 137, 137, 137, 33, 35, 35, 35, 35, 35, 72, 72, 134, 114, 114, 114, 114, 114, 114, 114, 93, 114, 93, 106, 106, 106, 106, 106, 106, 106, 4, 4, 4, 4, 4, 125, 94, 94, 96, 96, 96, 96, 134, 134, 16, 16, 51, 117, 117, 117, 71, 71, 71, 71, 71, 137, 137, 137,
+#> 137, 79, 79, 79, 79, 79, 79, 117, 33, 33, 33, 33, 33, 33, 33, 33, 131, 16, 125, 4, 55, 55, 55, 55, 55, 137, 137, 96, 79, 79, 66, 79, 66, 66, 38, 38, 38, 38, 38, 38, 38, 38, 137, 137, 137, 137, 137, 137, 137, 137, 137, 137, 137, 137, 137, 5, 5, 5, 131, 131, 16, 16, 16, 3, 3, 52, 52, 52, 52, 52, 137, 66, 66, 66, 66, 66, 5, 5, 5, 5, 66, 66, 66, 66, 66, 3, 3, 3, 3, 3, 51, 51, 51, 94, 79, 79, 78, 78, 78, 78, 78, 58, 78, 4, 4, 4, 4, 125, 125, 125, 130, 130, 114, 76, 76, 76, 131, 131, 131, 5, 131, 5, 5,
+#> 5, 5, 125, 125, 125, 125, 125, 106, 106, 106, 106, 106, 106, 79, 79, 79, 79, 79, 79, 79, 79, 79, 79, 79, 51, 51, 51, 94, 78, 66, 66, 66, 66, 66, 114, 35, 35, 35, 35, 131, 131, 114, 114, 114, 114, 114, 94, 94, 116, 66, 35, 78, 78, 78, 93, 106, 76, 76, 117, 45, 45, 45, 45, 45, 116, 116, 116, 116, 116, 58, 58, 58, 58, 35, 51, 51, 51, 51, 94, 94, 94, 76, 76, 76, 55, 55, 76, 76, 76, 76, 117, 117, 117, 117, 117, 117, 117, 33, 33, 94, 94, 58, 58, 58, 58, 58, 134, 45, 45, 45, 45, 45, 45, 45, 45, 45, 45,
+#> 106, 106, 106, 106, 106, 106, 106, 137, 137, 137, 78, 78, 78, 66, 66, 66, 66, 66, 94, 94, 94, 5, 5, 5, 5, 35, 35, 35, 130, 130, 130, 96, 96, 16, 96, 52, 94, 71, 71, 71, 71, 72, 72, 72, 72, 76, 3, 3, 3, 3, 106, 106, 106, 106, 117, 117, 117, 117, 117, 96, 96, 96, 96, 134, 94, 94, 94, 94, 94, 94, 94, 58, 35, 71, 71, 71, 71, 71, 71, 116, 79, 116, 66, 58, 58, 58, 52, 52, 16, 16, 16) x c(55, 72, 45, 61, 59, 65, 76, 3, 8, 37, 7, 11, 39, 59, 69, 64, 60, 62, 85, 85, 80, 84, 97, 114, 98, 121, 123, 133, 121, 69, 31, 54, 78, 81, 78, 70, 84, 91, 56, 81, 86, 6, 72, 83, 89, 87, 66, 66, 51, 24, 35, 45, 29, 23, 78, 52, 138, 124, 130, 134, 137, 129, 109, 12, 46, 53, 70, 62, 47, 64, 56, 51, 47, 30, 8, 11, 39, 22, 3, 21, 72, 55, 63, 55, 73, 45, 55, 16, 29, 37, 22, 33, 73, 62, 70, 56, 56, 53, 40, 41, 3, 71, 136, 138, 127, 147, 131, 125, 130, 131, 134, 152, 147, 55, 79, 18, 15, 1, 17, 55, 53,
+#> 53, 52, 47, 53, 48, 47, 44, 41, 45, 45, 41, 43, 38, 40, 46, 36, 35, 21, 11, 7, 39, 127, 147, 77, 102, 131, 86, 1, 125, 140, 65, 152, 137, 157, 128, 159, 90, 117, 137, 121, 129, 113, 2, 10, 30, 30, 2, 34, 39, 46, 46, 43, 44, 43, 31, 10, 6, 42, 42, 45, 48, 44, 38, 41, 56, 37, 38, 45, 43, 40, 41, 27, 1, 12, 128, 151, 125, 106, 118, 130, 133, 131, 102, 39, 75, 58, 145, 142, 152, 74, 110, 10, 145, 136, 77, 44, 141, 151, 150, 21, 97, 2, 39, 84, 77, 80, 76, 83, 96, 98, 109, 7, 75, 84, 74, 27, 1, 22, 72,
+#> 98, 76, 32, 108, 98, 118, 112, 137, 97, 45, 89, 41, 1, 1, 31, 101, 131, 140, 137, 150, 154, 145, 144, 152, 156, 154, 146, 149, 153, 157, 156, 100, 61, 2, 155, 154, 155, 148, 83, 152, 18, 29, 42, 57, 66, 32, 52, 63, 62, 17, 10, 5, 2, 4, 33, 34, 28, 35, 36, 42, 42, 33, 13, 39, 5, 5, 46, 48, 40, 46, 44, 28, 37, 30, 22, 26, 24, 6, 10, 1, 2, 41, 98, 150, 150, 156, 140, 146, 140, 122, 98, 156, 145, 152, 111, 124, 112, 128, 137, 145, 155, 121, 79, 134, 95, 4, 30, 45, 130, 154, 151, 126, 134, 133, 135, 139,
+#> 156, 139, 147, 137, 116, 138, 125, 100, 55, 26, 9, 14, 8, 32, 130, 153, 148, 143, 157, 143, 147, 95, 124, 73, 6, 2, 86, 65, 51, 113, 109, 104, 124, 110, 140, 72, 88, 81, 48, 69, 101, 77, 15, 74, 114, 132, 123, 111, 107, 104, 126, 91, 75, 27, 81, 80, 66, 78, 121, 34, 126, 60, 42, 150, 37, 155, 56, 12, 77, 35, 75, 132, 131, 128, 149, 148, 106, 129, 113, 104, 72, 141, 118, 148, 151, 152, 123, 110, 9, 2, 1, 26, 31, 31, 36, 36, 46, 50, 46, 53, 16, 39, 9, 26, 36, 12, 37, 42, 38, 41, 48, 45, 41, 16, 19,
+#> 9, 61, 151, 147, 135, 140, 136, 129, 132, 147, 142, 142, 151, 137, 150, 130, 145, 114, 150, 156, 123, 74, 27, 49, 88, 132, 117, 150, 112, 115, 134, 122, 147, 149, 143, 150, 156, 101, 102, 26, 124, 152, 99, 154, 151, 126, 127, 125, 46, 143, 136, 139, 83, 71, 24, 56, 1, 1, 41, 41, 32, 38, 52, 39, 52, 43, 41, 39, 41, 39, 33, 35, 34, 27, 46, 35, 24, 33, 39, 15, 10, 44, 33, 21, 5, 20, 123, 146, 97, 102, 140, 151, 154, 139, 132, 137, 151, 72, 55, 64, 30, 93, 6, 14, 102, 153, 153, 132, 153, 148, 152, 155,
+#> 155, 156, 97, 140, 153, 139, 154, 145, 152, 118, 106, 95, 36, 9, 3, 37, 57, 94, 114, 72, 87, 87, 82, 46, 33, 11, 3, 2, 29, 131, 137, 89, 72, 29, 1, 7, 31, 143, 141, 141, 153, 141, 158, 150, 151, 142, 127, 134, 150, 132, 131, 150, 135, 117, 150, 141, 64, 33, 36, 45, 46, 41, 26, 43, 36, 35, 38, 40, 37, 41, 34, 42, 37, 20, 14, 36, 40, 45, 42, 55, 54, 55, 64, 58, 57, 65, 56, 33, 38, 43, 42, 39, 36, 35, 26, 40, 46, 53, 47, 50, 70, 55, 53, 50, 40, 38, 12, 11, 43, 6, 6, 24, 35, 44, 43, 24, 21, 29, 10, 119,
+#> 72, 61, 66, 142, 20, 157, 142, 150, 144, 153, 157, 155, 145, 147, 128, 129, 141, 104, 23, 41, 10, 46, 81, 113, 143, 150, 143, 100, 95, 48, 102, 120, 33, 35, 4, 1, 4, 25, 34, 40, 28, 43, 40, 40, 16, 3, 34, 35, 25, 27, 26, 9, 33, 19, 53, 64, 56, 69, 75, 125, 124, 118, 136, 111, 129, 93, 88, 31, 2, 12, 1, 3, 106, 51, 98, 135, 127, 146, 131, 133, 149, 152, 151, 135, 108, 82, 28, 131, 153, 107, 30, 10, 2, 31, 38, 41, 38, 40, 41, 9, 36, 36, 4, 3, 7, 86, 64, 134, 120, 153, 136, 143, 36, 17, 28, 147, 109,
+#> 5, 6, 44, 80, 40, 84, 60, 103, 48, 22, 2, 1, 32, 67, 78, 83, 110, 117, 87, 53, 17, 24, 24, 78, 37, 46, 52, 56, 2, 5, 29, 27, 32, 46, 2, 43, 31, 38, 44, 45, 20, 40, 36, 32, 27, 48, 28, 26, 28, 20, 1, 7, 18, 80, 98, 116, 120, 111, 79, 97, 77, 2, 9, 9, 24, 95, 155, 154, 140, 143, 143, 154, 121, 132, 138, 146, 156, 122, 72, 45, 115, 56, 1, 34, 32, 8, 12, 33, 10, 9, 148, 146, 148, 149, 149, 150, 100, 146, 126, 141, 94, 69, 1, 77, 88, 141, 121, 80, 122, 100, 94, 99, 54, 38, 78, 3, 34, 37, 44, 12, 17, 18,
+#> 21, 30, 26, 5, 5, 20, 147, 154, 148, 122, 45, 83, 155, 146, 17, 139, 146, 94, 62, 108, 113, 113, 101, 133, 141, 103, 74, 69, 55, 53, 10, 46, 15, 90, 127, 133, 126, 120, 134, 110, 80, 47, 25, 50, 46, 47, 48, 49, 49, 47, 3, 30, 46, 31, 33, 39, 21, 32, 7, 23, 37, 34, 22, 9, 144, 149, 145, 139, 126, 150, 127, 125, 108, 140, 142, 136, 156, 125, 102, 69, 104, 147, 151, 143, 143, 132, 145, 150, 9, 113, 135, 75, 113, 137, 5, 14, 79, 148, 155, 122, 93, 147, 65, 150, 135, 106, 48, 50, 1, 29, 13, 45, 43, 42,
+#> 39, 6, 27, 36, 37, 34, 8, 28, 39, 39, 38, 6, 26, 19, 38, 126, 153, 148, 149, 119, 140, 150, 117, 120, 148, 152, 142, 154, 146, 59, 47, 1, 3, 19, 113, 138, 143, 131, 155, 127, 148, 146, 127, 139, 154, 153, 137, 52, 38, 33, 61, 61, 84, 62, 47, 51, 125, 96, 114, 69, 35, 27, 119, 2, 82, 10, 17, 9, 111, 153, 124, 142, 80, 144, 110, 84, 6, 3, 5, 46, 65, 99, 143, 145, 127, 146, 139, 107, 40, 150, 121, 123, 16, 118, 104, 144, 153, 145, 124, 132, 109, 149, 141, 127, 88, 139, 27, 144, 154, 146, 148, 152, 155,
+#> 154, 107, 120, 36, 41, 42, 43, 41, 33, 12, 79, 107, 116, 110, 118, 88, 113, 122, 134, 124, 84, 114, 73, 103, 97, 91, 94, 45, 30, 10, 12, 40, 33, 8, 17, 24, 37, 16, 39, 49, 7, 25, 15, 40, 124, 145, 127, 140, 134, 140, 78, 54, 94, 116, 31, 33, 137, 143, 150, 43, 94, 19, 4, 130, 147, 149, 150, 137, 140, 121, 83, 46, 26, 156, 140, 123, 138, 145, 146, 149, 109, 105, 137, 148, 148, 152, 98, 141, 150, 111, 88, 23, 129, 136, 135, 129, 140, 108, 131, 151, 128, 142, 123, 57, 125, 82, 16, 2, 5, 42, 36, 32,
+#> 48, 37, 16, 29, 28, 36, 9, 18, 26, 143, 156, 149, 155, 142, 11, 131, 134, 153, 155, 141, 152, 75, 78, 9, 112, 146, 142, 145, 149, 143, 23, 25, 100, 112, 80, 119, 119, 121, 100, 76, 108, 97, 80, 61, 66, 55, 7, 1, 6, 29, 150, 154, 155, 155, 152, 119, 139, 154, 149, 156, 154, 93, 88, 24, 49, 14, 1, 51, 150, 135, 53, 113, 90, 36, 41, 39, 6, 48, 43, 48, 32, 24, 27, 117, 4, 139, 160, 149, 156, 126, 122, 145, 97, 115, 123, 145, 25, 12, 14, 11, 7, 100, 144, 132, 115, 39, 32, 50, 87, 108, 104, 120, 118, 107,
+#> 55, 63, 153, 142, 127, 125, 92, 108, 42, 153, 156, 107, 79, 128, 127, 111, 149, 104, 10, 86, 122, 149, 153, 144, 147, 6, 58, 28, 49, 55, 151, 118, 138, 94, 109, 148, 146, 151, 136, 148, 107, 107, 131, 99, 66, 21, 1, 13, 38, 45, 16, 2, 30, 41, 12, 37, 5, 14, 81, 151, 135, 114, 132, 154, 138, 142, 151, 150, 150, 149, 118, 20, 154, 116, 5, 42, 67, 52, 95, 130, 142, 152, 110, 152, 153, 98, 152, 151, 154, 135, 145, 145, 133, 137, 125, 28, 64, 42, 106, 79, 69, 140, 96, 138, 155, 79, 77, 114, 118, 73, 52,
+#> 91, 18, 139, 145, 115, 138, 149, 154, 154, 107, 143, 138, 134, 155, 140, 156, 42, 100, 19, 11, 46, 24, 10, 2, 20, 7, 29, 4, 44, 3, 128, 118, 118, 49, 78, 80, 64, 92, 23, 53, 87, 47, 10, 16, 3, 82, 141, 150, 142, 27, 1, 134, 22, 60, 42, 147, 151, 136, 148, 151, 118, 112, 140, 151, 121, 146, 152, 53, 135, 142, 3, 40, 27, 36, 35, 9, 20, 41, 45, 40, 44, 49, 38, 40, 37, 31, 141, 106, 154, 109, 156, 128, 115, 111, 11, 74, 6, 85, 120, 98, 105, 97, 125, 104, 103, 62, 45, 9, 74, 145, 69, 39, 136, 113, 133,
+#> 149, 112, 49, 138, 121, 134, 144, 140, 46, 115, 101, 2, 129, 150, 154, 156, 140, 154, 155, 126, 66, 130, 140, 155, 153, 149, 133, 27, 86, 144, 108, 19, 6, 30, 40, 38, 44, 41, 38, 36, 44, 38, 41, 39, 38, 32, 8, 8, 9, 69, 80, 87, 121, 130, 129, 114, 125, 149, 106, 133, 113, 106, 35, 74, 10, 81, 155, 130, 147, 148, 142, 149, 151, 151, 126, 128, 139, 108, 152, 145, 130, 127, 2, 30, 26, 15, 12, 7, 42, 43, 44, 41, 35, 38, 40, 17, 131, 115, 80, 140, 152, 66, 76, 102, 147, 153, 154, 154, 135, 126, 139, 131,
+#> 98, 132, 45, 6, 42, 41, 26, 43, 37, 36, 40, 40, 34, 31, 39, 48, 33, 11, 23, 29, 30, 17, 4, 10, 8, 4, 15, 70, 1, 95, 157, 142, 145, 148, 122, 122, 139, 149, 147, 154, 155, 126, 57, 68, 7, 115, 69, 132, 150, 123, 135, 155, 149, 151, 151, 142, 146, 3, 6, 13, 70, 153, 113, 120, 107, 133, 154, 144, 153, 96, 43, 3, 1, 1, 9, 33, 53, 9, 46, 45, 42, 37, 31, 12, 37, 32, 31, 18, 4, 58, 155, 7, 141, 153, 143, 154, 148, 154, 152, 152, 142, 148, 150, 147, 120, 106, 73, 97, 5, 51, 49, 47, 37, 49, 41, 25, 21, 5,
+#> 45, 46, 38, 43, 41, 43, 35, 33, 37, 32, 36, 5, 12, 12, 26, 14, 30, 38, 47, 48, 43, 40, 41, 41, 31, 1, 144, 100, 123, 157, 126, 138, 154, 154, 154, 152, 153, 22, 33, 40, 4, 64, 72, 105, 85, 94, 114, 40, 97, 58, 37, 7, 121, 130, 153, 141, 149, 152, 133, 130, 95, 40, 50, 35, 41, 11, 25, 40, 43, 43, 33, 21, 34, 27, 18, 27, 31, 29, 44, 42, 36, 38, 48, 35, 38, 22, 13, 45, 51, 35, 23, 38, 12, 39, 14, 14, 37, 54, 110, 153, 132, 151, 145, 120, 135, 153, 141, 138, 133, 131, 115, 147, 140, 103, 93, 17, 17,
+#> 49, 11, 8, 32, 155, 149, 151, 145, 144, 147, 136, 61, 116, 147, 39, 51, 64, 43, 133, 92, 125, 137, 147, 150, 123, 89, 66, 42, 12, 23, 38, 35, 23, 13, 40, 42, 37, 34, 33, 33, 7, 2, 8, 21, 31, 32, 43, 121, 104, 123, 119, 84, 60, 146, 148, 102, 123, 112, 94, 60, 8, 1, 39, 38, 25, 41, 37, 36, 5, 45, 50, 39, 38, 60, 57, 28, 17, 3, 7, 15, 34, 46, 51, 56, 45, 52, 37, 30, 43, 32, 35, 29, 17, 23, 35, 24, 29, 38, 39, 23, 43, 40, 40, 42, 35, 39, 37, 34, 43, 35, 32, 22, 25, 16, 31, 19, 2, 42, 45, 49, 67, 49,
+#> 34, 55, 13, 47, 35, 12, 136, 151, 155, 91, 138, 153, 153, 152, 144, 153, 62, 155, 122, 95, 7, 6, 68, 101, 148, 141, 148, 143, 128, 65, 63, 59, 19, 38, 20, 16, 1, 69, 136, 150, 79, 140, 145, 149, 118, 144, 153, 150, 141, 141, 151, 125, 142, 15, 26, 27, 48, 56, 58, 59, 55, 50, 43, 55, 40, 59, 53, 38, 1, 8, 12, 10, 24, 18, 5, 35, 33, 38, 30, 45, 43, 46, 34, 14, 21, 30, 23, 11, 3, 22, 154, 153, 153, 153, 155, 154, 153, 155, 152, 109, 130, 125, 135, 12, 50, 14, 148, 151, 154, 152, 151, 141, 147, 147,
+#> 147, 120, 114, 146, 149, 107, 75, 2, 39, 2, 1, 3, 52, 49, 94, 96, 128, 131, 71, 17, 94, 147, 61, 75, 16, 91, 94, 85, 50, 55, 22, 44, 14, 2, 3, 13, 31, 37, 42, 39, 43, 33, 37, 34, 29, 33, 32, 31, 19, 38, 35, 26, 2, 2, 21, 45, 42, 41, 44, 26, 21, 39, 16, 8, 1, 2, 36, 37, 35, 31, 24, 34, 38, 31, 35, 30, 27, 28, 6, 19, 20, 12, 103, 102, 130, 135, 126, 153, 148, 113, 140, 112, 134, 137, 153, 143, 126, 35, 82, 35, 42, 10, 1, 43, 119, 121, 135, 124, 121, 66, 81, 17, 64, 85, 20, 110, 26, 108, 140, 145, 152,
+#> 143, 138, 143, 127, 112, 102, 103, 28, 16, 45, 2, 51, 44, 38, 42, 36, 24, 29, 32, 17, 14, 28, 5, 11, 11, 24, 32, 38, 32, 32, 35, 40, 47, 40, 34, 28, 27, 25, 25, 22, 23, 30, 3, 96, 151, 112, 111, 127, 150, 149, 116, 145, 52, 53, 137, 128, 126, 17, 7, 142, 153, 142, 150, 152, 149, 144, 130, 130, 155, 135, 154, 119, 57, 5, 31, 85, 111, 117, 93, 127, 120, 25, 141, 116, 121, 140, 130, 116, 121, 110, 88, 97, 37, 64, 19, 109, 117, 145, 139, 146, 146, 64, 134, 152, 149, 140, 99, 100, 90, 42, 58, 18, 10,
+#> 6, 3, 79, 82, 113, 116, 136, 149, 127, 117, 131, 108, 69, 66, 33, 14, 51, 36, 22, 134, 120, 126, 131, 135, 130, 122, 139, 130, 129, 115, 44, 27, 152, 153, 147, 106, 119, 143, 138, 128, 154, 146, 138, 128, 143, 103, 125, 93, 9, 37, 9, 40, 4, 14, 101, 150, 154, 150, 147, 148, 135, 145, 101, 47, 151, 150, 132, 151, 147, 147, 79, 38, 9, 41, 43, 41, 41, 49, 40, 57, 42, 49, 51, 50, 29, 26, 23, 24, 21, 22, 22, 20, 5, 1, 1, 11, 117, 153, 157, 85, 133, 139, 156, 154, 110, 70, 142, 45, 62, 144, 117, 82, 153,
+#> 153, 119, 143, 108, 24, 135, 77, 127, 71, 9, 37, 134, 137, 153, 154, 152, 149, 146, 131, 108, 91, 145, 142, 107, 140, 65, 21, 91, 89, 90, 72, 24, 33, 39, 109, 105, 66, 32, 24, 57, 8, 21, 33, 42, 36, 43, 47, 33, 23, 32, 8, 18, 2, 4, 4, 137, 105, 135, 119, 130, 126, 44, 22, 84, 147, 146, 129, 127, 151, 140, 82, 4, 9, 29, 149, 147, 152, 143, 148, 155, 147, 112, 18, 114, 148, 133, 121, 6, 109, 120, 99, 136, 151, 154, 142, 49, 88, 146, 149, 153, 137, 119, 82, 132, 17, 15, 10, 10, 100, 132, 153, 118, 153,
+#> 148, 13, 133, 12, 45, 45, 51, 39, 42, 50, 41, 44, 45, 22, 35, 35, 32, 24, 25, 23, 21, 42, 40, 37, 35, 34, 34, 39, 30, 11, 7, 3, 107, 62, 142, 146, 145, 150, 155, 112, 135, 117, 67, 7, 34, 3, 22, 39, 31, 39, 4, 39, 38, 38, 27, 12, 20, 31, 8, 4, 28, 38, 42, 40, 36, 9, 10, 13, 10, 126, 155, 155, 154, 154, 154, 155, 156, 152, 154, 149, 155, 157, 157, 8, 155, 153, 116, 147, 143, 135, 142, 139, 123, 130, 150, 126, 54, 14, 13, 1, 13, 22, 43, 37, 37, 46, 46, 40, 36, 42, 30, 26, 8, 16, 16, 8, 18, 36, 48,
+#> 39, 22, 27, 11, 6, 44, 40, 36, 37, 34, 43, 12, 18, 35, 33, 4, 1, 36, 9, 17, 27, 42, 48, 40, 43, 37, 39, 39, 35, 34, 38, 33, 43, 44, 35, 36, 19, 1, 48, 39, 30, 37, 35, 29, 33, 38, 33, 28, 29, 19, 20, 33, 37, 30, 25, 16, 144, 155, 152, 151, 145, 150, 154, 154, 146, 139, 148, 154, 148, 125, 89, 11, 95, 114, 82, 83, 9, 1, 3, 77, 133, 98, 150, 149, 150, 154, 153, 154, 123, 153, 145, 79, 85, 95, 108, 90, 128, 21, 120, 120, 107, 115, 92, 113, 91, 93, 85, 39, 3, 4, 16, 150, 152, 151, 68, 154, 134, 121, 140,
+#> 122, 106, 129, 147, 112, 72, 19, 55, 3, 101, 15, 19, 23, 19, 21, 15, 41, 40, 13, 27, 44, 51, 52, 9, 29, 33, 9, 5, 47, 33, 18, 37, 35, 30, 32, 45, 11, 31, 42, 41, 35, 8, 38, 35, 34, 16, 29, 24, 93, 78, 103, 138, 134, 120, 122, 83, 144, 140, 15, 89, 35, 40, 49, 39, 48, 45, 49, 33, 36, 39, 38, 33, 21, 13, 27, 1, 3, 52, 104, 140, 138, 153, 130, 148, 78, 144, 138, 97, 90, 26, 82, 81, 65, 20, 126, 112, 75, 148, 40, 121, 26, 18, 23, 5, 8, 123, 133, 154, 155, 154, 101, 152, 155, 154, 150, 154, 144, 152,
+#> 118, 139, 127, 45, 59, 17, 142, 155, 145, 124, 110, 122, 124, 121, 85, 119, 125, 101, 153, 151, 127, 117, 127, 30, 26, 2, 24, 150, 145, 152, 149, 142, 137, 138, 144, 122, 63, 89, 26, 44, 49, 43, 36, 21, 33, 25, 3, 19, 20, 34, 32, 38, 37, 35, 43, 27, 43, 52, 38, 1, 2, 47, 53, 48, 55, 61, 34, 75, 61, 18, 53, 5, 26, 3, 2, 4, 7, 150, 147, 154, 150, 135, 14, 129, 8, 56, 84, 109, 150, 51, 13, 33, 1, 42, 40, 45, 36, 37, 31, 34, 29, 35, 28, 3, 33, 6, 66, 80, 39, 76, 80, 97, 76, 75, 68, 47, 69, 59, 33, 20,
+#> 39, 37, 36, 40, 45, 49, 42, 42, 39, 24, 29, 31, 26, 24, 12, 19, 13, 8, 36, 114, 154, 140, 134, 148, 43, 78, 83, 10, 26, 61, 118, 149, 153, 139, 154, 149, 150, 147, 155, 150, 149, 124, 144, 135, 30, 70, 15, 89, 151, 139, 155, 153, 151, 154, 140, 152, 156, 134, 24, 87, 64, 8, 38, 12, 63, 145, 154, 156, 143, 152, 127, 144, 81, 148, 143, 143, 149, 143, 45, 59, 76, 3, 6, 19, 20, 35, 37, 28, 37, 32, 40, 23, 9, 21, 21, 99, 107, 51, 141, 149, 151, 154, 132, 144, 106, 19, 98, 26, 2, 26, 6, 53, 40, 47, 38,
+#> 40, 38, 45, 41, 41, 30, 44, 24, 32, 39, 29, 41, 34, 35, 47, 48, 31, 43, 33, 24, 35, 39, 33, 3, 47, 45, 51, 43, 41, 38, 37, 29, 29, 32, 42, 35, 10, 37, 42, 40, 37, 41, 35, 35, 36, 38, 18, 28, 13, 6, 27, 27, 20, 13, 1, 9, 64, 149, 156, 148, 154, 152, 115, 119, 29, 117, 115, 129, 25, 85, 116, 50, 14, 12, 4, 15, 40, 37, 35, 38, 34, 31, 34, 32, 26, 9, 23, 13, 1, 1, 20, 35, 39, 52, 44, 40, 36, 31, 34, 33, 37, 15, 12, 21, 9, 25, 154, 153, 113, 154, 153, 138, 152, 156, 135, 133, 11, 155, 153, 47, 75, 15,
+#> 12, 27, 40, 42, 44, 34, 40, 11, 16, 17, 5, 34, 33, 2, 1, 47, 51, 51, 53, 51, 27, 13, 19, 10, 1, 1, 1, 72, 143, 129, 135, 154, 152, 146, 137, 145, 128, 127, 105, 139, 5, 104, 90, 99, 5, 10, 130, 109, 130, 108, 130, 104, 120, 112, 140, 132, 128, 106, 109, 82, 85, 54, 14, 152, 144, 133, 146, 153, 139, 132, 131, 147, 143, 138, 148, 64, 18, 38, 125, 142, 120, 132, 146, 133, 122, 138, 152, 122, 44, 92, 115, 57, 26, 49, 8, 37, 36, 36, 41, 31, 38, 34, 34, 33, 40, 35, 34, 28, 33, 26, 24, 8, 35, 34, 33, 36,
+#> 36, 39, 34, 25, 29, 29, 25, 23, 25, 4, 9, 151, 156, 145, 137, 150, 150, 138, 30, 59, 99, 16, 97, 2, 20, 3, 128, 111, 126, 126, 140, 128, 128, 105, 71, 131, 36, 59, 114, 103, 118, 115, 91, 56, 61, 26, 148, 149, 154, 155, 156, 146, 150, 106, 37, 133, 142, 48, 78, 128, 66, 26, 41, 75, 20, 5, 22, 7, 27, 34, 40, 37, 49, 29, 41, 35, 13, 1, 129, 152, 149, 137, 156, 126, 148, 152, 156, 106, 128, 149, 64, 65, 4, 108, 3, 152, 124, 145, 128, 134, 147, 143, 109, 98, 21, 51, 45, 45, 10, 4, 31, 27, 32, 14, 2,
+#> 82, 30, 43, 31, 23, 23, 11, 36, 40, 39, 44, 44, 42, 36, 38, 39, 29, 31, 15, 29, 19, 30, 11, 13, 15, 80, 146, 132, 155, 121, 46, 6, 45, 89, 87, 35, 82, 124, 150, 148, 138, 154, 152, 153, 152, 150, 151, 150, 125, 151, 148, 152, 125, 120, 135, 31, 4, 3, 4, 86, 132, 139, 155, 152, 142, 125, 138, 138, 121, 8, 30, 39, 44, 38, 46, 45, 36, 30, 35, 38, 37, 24, 1, 117, 153, 152, 12, 154, 155, 138, 148, 19, 78, 142, 125, 2, 30, 65, 92, 152, 153, 149, 154, 133, 148, 137, 150, 154, 151, 140, 143, 141, 68, 73,
+#> 4, 9, 149, 153, 119, 104, 152, 138, 144, 146, 145, 116, 25, 14, 128, 128, 131, 73, 148, 155, 141, 93, 73, 77, 127, 121, 66, 39, 6, 123, 85, 145, 110, 135, 143, 98, 91, 88, 86, 40, 105, 138, 154, 134, 154, 107, 141, 58, 20, 138, 151, 145, 120, 132, 139, 154, 132, 141, 153, 76, 139, 116, 3, 31, 36, 32, 37, 4, 34, 35, 6, 18, 33, 38, 15, 14, 24, 13, 33, 25, 13, 23, 37, 24, 30, 34, 32, 11, 20, 27, 17, 15, 24, 85, 146, 154, 142, 115, 142, 116, 146, 150, 136, 140, 48, 56, 90, 78, 110, 88, 70, 6, 96, 139,
+#> 151, 118, 153, 138, 154, 81, 148, 150, 154, 142, 155, 18, 149, 139, 139, 142, 50, 72, 20, 111, 124, 149, 154, 152, 156, 149, 151, 140, 144, 98, 150, 92, 76, 151, 87, 154, 154, 151, 153, 156, 151, 145, 60, 63, 10, 30, 42, 39, 47, 47, 49, 42, 43, 42, 43, 36, 40, 6, 26, 38, 3, 37, 35, 32, 36, 35, 12, 17, 25, 22, 28, 7, 37, 32, 29, 33, 35, 5, 10, 7, 17, 4, 7, 41, 37, 27, 2, 37, 30, 151, 154, 149, 130, 154, 100, 31, 146, 126, 10, 114, 138, 102, 34, 36, 33, 27, 2, 7, 5, 126, 145, 149, 153, 155, 126, 142,
+#> 101, 154, 152, 106, 13, 90, 113, 78, 81, 23, 134, 107, 154, 154, 129, 150, 121, 48, 16, 64, 39, 16, 39, 35, 25, 25, 23, 3, 5, 18, 35, 30, 1, 89, 149, 135, 154, 151, 152, 139, 136, 69, 8, 37, 37, 29, 60, 60, 6, 52, 48, 55, 55, 45, 50, 53, 54, 45, 44, 33, 38, 30, 21, 8, 14, 50, 88, 104, 66, 10, 60, 49, 32, 123, 144, 116, 100, 66, 107, 119, 98, 36, 31, 62, 81, 49, 2, 12, 20, 126, 121, 100, 151, 147, 118, 60, 102, 86, 48, 141, 115, 36, 3, 2, 1, 50, 7, 28, 44, 31, 13, 46, 35, 6, 36, 43, 6, 30, 22, 10,
+#> 6, 37, 36, 10, 24, 17, 14, 11, 14, 10, 17, 21, 33, 30, 12, 35, 37, 40, 33, 31, 41, 33, 35, 1, 12, 24, 151, 156, 155, 154, 145, 126, 153, 152, 135, 81, 15, 75, 73, 118, 107, 132, 120, 121, 120, 129, 130, 109, 117, 105, 104, 117, 115, 88, 48, 3, 53, 65, 32, 93, 120, 135, 140, 130, 119, 40, 39, 43, 42, 44, 37, 37, 28, 32, 13, 13, 31, 16, 13, 25, 14, 148, 136, 147, 145, 124, 136, 42, 87, 80, 62, 127, 151, 155, 156, 147, 152, 112, 155, 144, 148, 119, 142, 141, 147, 153, 138, 152, 150, 138, 149, 149, 117,
+#> 144, 143, 14, 26, 39, 39, 43, 44, 9, 48, 42, 44, 36, 35, 33, 30, 25, 19, 25, 19, 10, 44, 43, 16, 33, 34, 35, 34, 6, 31, 32, 31, 26, 32, 34, 33, 35, 41, 45, 45, 149, 144, 143, 150, 150, 156, 137, 155, 89, 148, 6, 37, 117, 98, 136, 132, 129, 103, 113, 9, 22, 52, 23, 83, 49, 64, 56, 36, 15, 40, 37, 39, 40, 37, 37, 24, 24, 20, 7, 1, 51, 46, 24, 11, 28, 40, 63, 22, 14, 31, 32, 31, 31, 24, 1, 34, 125, 131, 148, 78, 124, 125, 150, 146, 141, 144, 111, 24, 24, 29, 1, 87, 78, 60, 149, 137, 153, 118, 132, 88,
+#> 41, 6, 63, 154, 101, 51, 98, 112, 117, 53, 58, 147, 137, 152, 155, 149, 151, 150, 154, 143, 105, 8, 12, 119, 3, 92, 144, 60, 99, 124, 136, 126, 21, 56, 88, 155, 119, 32, 53, 51, 5, 111, 138, 140, 152, 141, 44, 150, 45, 83, 60, 50, 54, 2, 11, 58, 135, 147, 152, 154, 156, 151, 105, 148, 143, 98, 41, 85, 55, 38, 5, 36, 77, 151, 154, 142, 154, 155, 115, 91, 151, 130, 85, 64, 19, 149, 120, 126, 139, 137, 116, 124, 75, 3, 24, 32, 43, 30, 34, 33, 28, 35, 11, 19, 15, 29, 7, 21, 11, 36, 24, 27, 18, 109, 138,
+#> 138, 135, 146, 130, 136, 152, 15, 137, 74, 16, 32, 102, 156, 151, 131, 146, 157, 142, 149, 150, 95, 63, 138, 108, 147, 107, 132, 145, 34, 79, 4, 22, 4, 43, 26, 10, 23, 30, 3, 29, 16, 37, 40, 31, 27, 11, 10, 9, 33, 27, 21, 14, 1, 16, 1, 15, 33, 29, 36, 4, 12, 16, 29, 16, 7, 15, 3, 146, 93, 58, 137, 125, 122, 110, 64, 84, 53, 74, 34, 1, 2, 9, 34, 41, 48, 38, 35, 42, 4, 46, 56, 37, 7, 18, 112, 149, 140, 113, 152, 156, 147, 146, 151, 148, 123, 140, 143, 69, 108, 10, 91, 24, 96, 77, 11, 74, 88, 115, 143,
+#> 100, 146, 118, 129, 137, 138, 63, 134, 127, 136, 85, 61, 82, 14, 156, 137, 115, 147, 124, 118, 132, 1, 149, 154, 149, 149, 152, 110, 149, 116, 151, 153, 80, 13, 12, 38, 35, 28, 39, 29, 15, 29, 12, 23, 28, 28, 26, 23, 18, 33, 22, 18, 45, 21, 44, 35, 39, 41, 14, 25, 21, 37, 2, 30, 38, 3, 36, 35, 33, 7, 1, 12, 23, 11, 27, 28, 24, 30, 1, 4, 34, 17, 51, 86, 149, 149, 153, 152, 147, 114, 7, 104, 3, 145, 137, 145, 149, 115, 150, 155, 155, 149, 109, 92, 44, 46, 101, 3, 22, 4, 47, 38, 29, 37, 37, 34, 20,
+#> 4, 28, 10, 8, 1, 37, 42, 29, 32, 12, 1, 43, 19, 9, 3, 1, 125, 155, 147, 129, 144, 123, 146, 149, 144, 134, 106, 67, 3, 80, 122, 131, 117, 128, 133, 106, 130, 24, 62, 86, 58, 32, 147, 153, 155, 143, 148, 127, 131, 25, 69, 103, 20, 49, 3, 104, 135, 102, 155, 155, 153, 155, 151, 155, 154, 48, 102, 31, 155, 85, 132, 127, 113, 108, 15, 124, 94, 11, 35, 33, 40, 36, 45, 51, 42, 40, 34, 32, 33, 34, 42, 26, 10, 2, 30, 40, 43, 33, 37, 5, 31, 30, 30, 30, 28, 22, 7, 155, 78, 111, 112, 110, 59, 3, 3, 12, 140,
+#> 157, 146, 156, 149, 155, 157, 146, 152, 154, 157, 153, 154, 156, 134, 135, 115, 116, 123, 135, 124, 5, 17, 52, 47, 42, 41, 41, 44, 35, 26, 24, 21, 28, 6, 68, 125, 122, 112, 4, 87, 140, 91, 82, 42, 102, 15, 109, 102, 53, 57, 14, 54, 40, 48, 132, 150, 8, 2, 110, 151, 143, 157, 109, 127, 15, 6, 83, 154, 152, 129, 148, 141, 70, 7, 93, 50, 1, 1, 28, 33, 39, 37, 47, 40, 37, 40, 39, 38, 35, 17, 26, 7, 26, 2, 32, 148, 141, 143, 156, 143, 144, 140, 150, 151, 139, 142, 136, 98, 67, 48, 95, 144, 154, 143, 80,
+#> 5, 9, 146, 155, 138, 1, 155, 56, 55, 98, 4, 45, 2, 4, 44, 41, 36, 22, 11, 37, 30, 19, 55, 145, 127, 151, 132, 144, 155, 125, 151, 146, 140, 139, 149, 106, 2, 98, 17, 8, 26, 6, 154, 127, 61, 43, 143, 148, 118, 138, 147, 154, 150, 148, 129, 88, 22, 43, 151, 139, 154, 154, 152, 108, 14, 125, 154, 154, 134, 140, 102, 150, 152, 147, 81, 34, 88, 40, 13, 34, 38, 118, 3, 51, 42, 7, 85, 100, 95, 83, 57, 61, 45, 52, 31, 4, 1, 9, 14, 3, 44, 37, 37, 30, 38, 27, 31, 27, 30, 5, 19, 36, 28, 40, 15, 2, 32, 41, 33,
+#> 33, 21, 7, 13, 25, 75, 22, 86, 149, 21, 38, 64, 138, 154, 8, 146, 113, 142, 7, 146, 124, 106, 92, 22, 65, 107, 136, 143, 152, 132, 139, 127, 111, 105, 82, 89, 41, 27, 71, 6, 5, 115, 139, 149, 133, 142, 146, 77, 10, 13, 128, 144, 65, 129, 142, 144, 146, 84, 49, 150, 140, 138, 86, 45, 83, 95, 71, 3, 29, 31, 24, 37, 29, 33, 32, 27, 24, 25, 27, 25, 29, 35, 15, 18, 33, 41, 39, 28, 13, 3, 11, 26, 141, 152, 155, 154, 149, 150, 139, 117, 105, 27, 31, 1, 6, 2, 3, 38, 42, 9, 36, 23, 36, 34, 23, 4, 40, 41,
+#> 38, 40, 37, 41, 9, 3, 22, 138, 54, 89, 145, 3, 100, 46, 65, 8, 128, 154, 134, 51, 142, 106, 76, 5, 138, 151, 145, 148, 154, 150, 153, 28, 90, 141, 154, 152, 151, 150, 119, 102, 119, 74, 9, 1, 139, 147, 105, 26, 152, 92, 134, 157, 147, 75, 39, 134, 26, 71, 128, 102, 21, 99, 1, 50, 100, 82, 98, 110, 107, 26, 36, 1, 53, 155, 148, 147, 152, 150, 97, 140, 150, 152, 134, 81, 82, 4, 9, 27, 16, 40, 37, 38, 39, 38, 21, 6, 31, 25, 5, 20, 24, 12, 19, 142, 89, 13, 153, 144, 146, 67, 138, 152, 145, 53, 17, 9,
+#> 125, 109, 87, 95, 86, 69, 91, 103, 92, 66, 77, 31, 44, 14, 141, 139, 152, 154, 153, 144, 151, 152, 145, 146, 153, 136, 106, 26, 5, 40, 40, 40, 43, 39, 37, 26, 7, 47, 41, 45, 25, 3, 84, 152, 151, 152, 142, 151, 155, 141, 154, 149, 140, 141, 145, 147, 103, 59, 108, 144, 151, 142, 136, 155, 145, 141, 146, 128, 3, 38, 148, 154, 151, 130, 145, 125, 146, 139, 136, 144, 94, 7, 83, 125, 116, 151, 141, 142, 137, 151, 147, 140, 134, 122, 131, 120, 119, 86, 64, 4, 2, 39, 41, 44, 35, 38, 41, 37, 36, 43, 41,
+#> 42, 36, 67, 131, 99, 90, 144, 127, 150, 142, 146, 115, 73, 92, 130, 96, 64, 50, 17, 51, 50, 4, 30, 7, 2, 33, 33, 22, 30, 40, 39, 23, 5, 8, 2, 144, 152, 156, 152, 150, 151, 149, 117, 41, 147, 113, 21, 16, 24, 43, 36, 34, 43, 42, 16, 7, 17, 17, 5, 1, 4, 24, 41, 37, 40, 41, 42, 52, 38, 41, 40, 39, 39, 41, 40, 40, 39, 36, 33, 39, 21, 16, 116, 131, 155, 143, 141, 105, 136, 21, 107, 122, 47, 22, 151, 147, 156, 144, 153, 149, 136, 124, 105, 117, 136, 145, 150, 151, 117, 145, 128, 65, 56, 58, 10, 50, 53,
+#> 106, 111, 110, 99, 87, 90, 20, 128, 122, 79, 55, 42, 5, 5, 55, 47, 52, 46, 72, 56, 54, 51, 40, 49, 43, 25, 15, 2, 15, 36, 38, 33, 35, 31, 28, 30, 20, 1, 46, 63, 87, 57, 80, 89, 114, 133, 126, 113, 37, 48, 122, 84, 30, 6, 23, 42, 38, 34, 36, 39, 16, 8, 10, 3, 5, 3, 24, 29, 32, 18, 2, 15, 137, 130, 154, 156, 151, 155, 154, 115, 48, 100, 140, 114, 18, 136, 50, 55, 19, 20, 32, 56, 55, 60, 37, 7, 2, 27, 129, 91, 110, 145, 154, 36, 106, 138, 55, 55, 22, 117, 101, 15, 35, 39, 40, 37, 35, 38, 19, 14, 21,
+#> 102, 119, 155, 149, 138, 85, 37, 128, 29, 94, 74, 136, 144, 25, 94, 131, 99, 8, 74, 6, 35, 1, 28, 134, 156, 153, 158, 153, 141, 154, 150, 153, 150, 141, 124, 101, 109, 54, 11, 9, 6, 131, 135, 130, 142, 141, 134, 150, 144, 140, 131, 66, 16, 83, 130, 126, 143, 128, 144, 111, 123, 124, 103, 39, 40, 40, 31, 57, 52, 34, 39, 11, 61, 24, 24, 140, 113, 31, 11, 92, 145, 144, 152, 152, 148, 115, 127, 141, 144, 138, 49, 33, 12, 33, 34, 28, 43, 48, 63, 23, 69, 48, 43, 29, 22, 1, 133, 144, 126, 153, 128, 153,
+#> 155, 144, 152, 134, 127, 81, 31, 128, 153, 121, 11, 8, 107, 43, 80, 72, 11, 136, 99, 37, 115, 152, 107, 141, 125, 93, 28, 63, 62, 26, 79, 14, 13, 1, 23, 43, 36, 41, 36, 23, 16, 32, 35, 23, 5, 3, 20, 10, 6, 53, 74, 58, 42, 48, 9, 33, 45, 8, 27, 117, 124, 108, 142, 153, 158, 134, 132, 150, 140, 149, 119, 122, 50, 8, 40, 53, 146, 152, 150, 144, 153, 149, 148, 151, 139, 106, 126, 101, 85, 80, 129, 91, 42, 42, 37, 40, 39, 34, 36, 13, 8, 21, 14, 2, 2, 129, 154, 157, 150, 151, 154, 152, 104, 122, 133, 35,
+#> 27, 21, 3, 141, 148, 151, 2, 29, 121, 147, 142, 134, 140, 149, 153, 131, 140, 119, 89, 21, 18, 131, 152, 141, 126, 141, 120, 141, 138, 127, 119, 121, 34, 151, 152, 152, 152, 152, 151, 153, 154, 162, 157, 157, 157, 152, 141, 148, 117, 139, 136, 69, 19, 66, 14, 47, 42, 35, 27, 34, 10, 23, 28, 2, 19, 6, 7, 10, 1, 39, 33, 21, 38, 34, 30, 36, 34, 27, 25, 15, 33, 37, 36, 34, 21, 7, 26, 51, 33, 33, 40, 43, 44, 7, 28, 55, 20, 14, 16, 9, 7, 31, 145, 96, 42, 145, 141, 151, 108, 142, 79, 75, 127, 88, 13, 6,
+#> 37, 40, 25, 14, 25, 3, 37, 57, 34, 5, 6, 32, 34, 7, 96, 142, 127, 146, 147, 150, 144, 150, 144, 153, 153, 123, 65, 143, 122, 108, 144, 144, 21, 43, 40, 44, 39, 44, 45, 51, 43, 39, 36, 35, 35, 26, 27, 35, 31, 20, 10, 11, 13, 21, 141, 128, 127, 68, 6, 34, 51, 109, 149, 20, 121, 73, 43, 131, 73, 103, 108, 6, 7, 5, 23, 155, 154, 148, 155, 137, 139, 121, 19, 155, 155, 145, 146, 151, 139, 139, 126, 131, 130, 120, 111, 54, 23, 3, 86, 151, 146, 147, 153, 149, 147, 145, 151, 144, 160, 148, 116, 111, 88, 137,
+#> 142, 151, 119, 151, 153, 135, 152, 146, 148, 145, 92, 40, 93, 57, 106, 5, 68, 72, 98, 6, 16, 12, 11, 2, 19, 31, 37, 32, 30, 25, 28, 2, 37, 4, 6, 30, 67, 76, 82, 94, 111, 92, 54, 37, 26, 26, 46, 26, 11, 40, 26, 3, 15, 12, 151, 152, 149, 142, 108, 145, 138, 134, 95, 122, 68, 53, 9, 113, 136, 134, 154, 135, 149, 149, 153, 138, 69, 100, 31, 60, 81, 107, 31, 80, 141, 150, 141, 143, 141, 138, 129, 113, 20, 22, 51, 4, 22, 20, 31, 39, 38, 49, 47, 47, 43, 42, 12, 9, 5, 43, 46, 63, 50, 71, 62, 13, 53, 34,
+#> 38, 32, 35, 42, 34, 34, 32, 40, 37, 2, 27, 36, 1, 21, 17, 33, 35, 5, 12, 30, 23, 8, 4, 144, 133, 24, 144, 144, 144, 120, 146, 156, 142, 145, 135, 6, 7, 3, 88, 130, 147, 152, 154, 155, 154, 154, 155, 155, 156, 150, 159, 157, 137, 133, 21, 145, 157, 138, 141, 151, 148, 149, 148, 153, 152, 152, 158, 141, 156, 134, 36, 101, 31, 30, 138, 152, 153, 149, 146, 136, 147, 153, 100, 145, 146, 125, 142, 131, 102, 131, 131, 133, 106, 91, 147, 20, 33, 34, 39, 31, 24, 30, 35, 33, 39, 38, 38, 39, 38, 22, 7, 10,
+#> 154, 154, 139, 156, 154, 155, 156, 138, 154, 130, 157, 163, 141, 151, 150, 155, 72, 39, 50, 44, 21, 45, 31, 28, 29, 23, 25, 18, 52, 46, 31, 6, 27, 1, 3, 152, 143, 145, 152, 153, 156, 153, 146, 146, 144, 151, 134, 157, 156, 146, 125, 110, 132, 152, 150, 148, 146, 139, 153, 162, 140, 156, 156, 155, 129, 130, 148, 132, 133, 103, 147, 129, 15, 49, 36, 147, 150, 142, 150, 149, 151, 153, 160, 159, 162, 144, 136, 57, 56, 10, 83, 25, 122, 153, 153, 151, 153, 154, 153, 155, 156, 161, 145, 150, 158, 155, 160,
+#> 147, 150, 139, 129, 120, 112, 137, 85, 5, 22, 39, 40, 39, 35, 42, 38, 34, 39, 41, 35, 34, 32, 39, 30, 38, 34, 2, 3, 45, 46, 39, 45, 45, 41, 47, 52, 46, 42, 39, 17, 21, 28, 8, 8, 19, 54, 19, 6, 27, 153, 155, 154, 152, 151, 156, 151, 148, 106, 82, 28, 11, 22, 109, 126, 98, 132, 113, 107, 138, 136, 101, 127, 140, 129, 116, 84, 35, 9, 138, 8, 147, 151, 153, 139, 151, 153, 149, 148, 154, 152, 39, 109, 30, 3, 2, 85, 154, 155, 154, 151, 150, 151, 145, 79, 124, 154, 137, 100, 8, 113, 157, 76, 127, 138, 132,
+#> 147, 153, 45, 135, 106, 109, 3, 33, 38, 36, 37, 39, 39, 45, 19, 9, 23, 50, 12, 10, 15, 15, 45, 36, 40, 38, 38, 43, 41, 41, 39, 43, 40, 27, 9, 25, 35, 31, 97, 98, 110, 103, 125, 107, 129, 136, 135, 150, 110, 126, 42, 66, 71, 1, 10, 35, 36, 27, 32, 33, 33, 34, 15, 24, 11, 19, 127, 147, 127, 129, 93, 52, 147, 147, 147, 144, 138, 68, 19, 18, 124, 117, 102, 146, 154, 127, 139, 148, 122, 142, 120, 148, 75, 6, 56, 151, 133, 149, 155, 151, 130, 100, 138, 121, 135, 20, 40, 29, 87, 53, 75, 5, 54, 134, 120,
+#> 144, 153, 162, 152, 150, 106, 125, 33, 46, 27, 81, 148, 152, 135, 151, 152, 159, 142, 162, 130, 162, 163, 143, 67, 112, 70, 34, 67, 79, 116, 138, 133, 112, 118, 131, 150, 142, 15, 107, 86, 69, 60, 50, 9, 48, 61, 37, 46, 5, 41, 42, 31, 29, 31, 28, 50, 49, 24, 45, 56, 7, 144, 147, 152, 152, 151, 145, 154, 148, 137, 146, 80, 25, 48, 144, 160, 154, 107, 122, 2, 148, 151, 151, 152, 162, 156, 142, 33, 19, 123, 151, 157, 154, 148, 71, 28, 3, 142, 33, 39, 6, 128, 153, 142, 157, 151, 149, 108, 135, 15, 124,
+#> 156, 126, 60, 39, 23, 15, 35, 5, 34, 35, 32, 35, 44, 49, 40, 38, 35, 38, 41, 39, 39, 35, 34, 12, 22, 5, 23, 57, 53, 58, 36, 38, 39, 55, 20, 29, 3, 3, 5, 30, 38, 43, 25, 54, 73, 35, 39, 41, 44, 37, 40, 34, 38, 40, 40, 37, 36, 17, 27, 20, 62, 128, 140, 151, 139, 108, 136, 34, 72, 98, 27, 18, 137, 145, 139, 143, 142, 137, 96, 82, 41, 16, 11, 150, 144, 159, 149, 148, 149, 135, 70, 153, 145, 81, 47, 52, 101, 106, 91, 152, 130, 160, 150, 135, 148, 149, 152, 105, 81, 130, 128, 122, 11, 71, 141, 108, 117,
+#> 48, 2, 14, 36, 33, 28, 35, 50, 39, 37, 30, 11, 7, 27, 28, 50, 44, 39, 34, 36, 38, 35, 11, 23, 21, 36, 34, 34, 26, 6, 15, 50, 145, 88, 152, 163, 162, 161, 163, 144, 157, 158, 162, 156, 158, 156, 153, 155, 153, 144, 71, 24, 5, 4, 48, 68, 26, 137, 133, 148, 147, 131, 131, 115, 48, 96, 142, 149, 148, 140, 149, 133, 106, 118, 85, 5, 25, 50, 116, 51, 99, 122, 136, 161, 157, 90, 141, 46, 119, 125, 100, 138, 26, 138, 144, 153, 159, 162, 160, 148, 159, 110, 127, 49, 95, 151, 142, 125, 151, 147, 138, 148,
+#> 161, 158, 161, 153, 155, 10, 34, 12, 2, 153, 155, 71, 144, 158, 162, 23, 157, 40, 86, 85, 59, 61, 16, 8, 9, 117, 92, 141, 123, 134, 149, 146, 149, 158, 161, 161, 153, 14, 95, 85, 87, 108, 134, 122, 126, 74, 146, 150, 140, 89, 73, 73, 146, 120, 62, 8, 35, 52, 29, 34, 39, 18, 11, 26, 15, 4, 39, 16, 28, 33, 6, 16, 26, 37, 46, 70, 57, 42, 9, 11, 4, 39, 31, 26, 62, 65, 55, 55, 57, 63, 71, 64, 41, 24, 12, 51, 62, 44, 37, 47, 38, 40, 36, 33, 38, 8, 18, 9, 9, 11, 5, 97, 73, 134, 150, 162, 161, 151, 159,
+#> 160, 149, 3, 36, 41, 40, 39, 32, 39, 42, 22, 16, 6, 5, 13, 14, 14, 35, 114, 118, 103, 128, 128, 135, 134, 136, 142, 116, 135, 115, 46, 124, 147, 111, 140, 105, 144, 146, 144, 152, 155, 152, 154, 147, 132, 138, 108, 132, 102, 27, 154, 154, 154, 155, 162, 156, 159, 156, 158, 130, 132, 148, 146, 136, 124, 115, 103, 83, 148, 148, 165, 134, 158, 158, 143, 149, 153, 104, 47, 132, 149, 71, 27, 34, 33, 16, 43, 11, 11, 1, 18, 12, 146, 159, 161, 162, 164, 162, 162, 163, 163, 161, 157, 150, 156, 117, 155, 120,
+#> 13, 58, 121, 159, 148, 147, 144, 142, 160, 152, 127, 142, 130, 135, 137, 121, 53, 5, 101, 134, 143, 154, 145, 163, 161, 160, 160, 162, 151, 60, 63, 40, 39, 46, 94, 110, 102, 108, 116, 7, 90, 90, 99, 114, 110, 100, 103, 91, 7, 68, 80, 79, 77, 3, 15, 12, 1, 18, 34, 32, 34, 39, 30, 34, 37, 9, 12, 35, 18, 56, 10, 29, 65, 27, 6, 12, 42, 20, 29, 4, 38, 42, 59, 47, 64, 60, 71, 66, 67, 51, 42, 2, 74, 87, 39, 133, 160, 149, 163, 144, 150, 135, 69, 38, 11, 3, 22, 7, 40, 9, 24, 35, 31, 43, 40, 27, 30, 15, 11,
+#> 2, 26, 37, 47, 46, 41, 40, 43, 42, 40, 58, 46, 38, 31, 12, 3, 13, 47, 48, 36, 46, 56, 47, 45, 36, 43, 56, 54, 24, 7, 31, 42, 43, 42, 36, 26, 40, 3, 4, 49, 41, 62, 24, 10, 160, 154, 134, 123, 112, 137, 144, 147, 116, 106, 111, 124, 113, 112, 22, 9, 157, 145, 153, 156, 151, 130, 152, 94, 45, 10, 8, 7, 2, 40, 44, 30, 34, 31, 33, 24, 34, 31, 31, 12, 1, 110, 132, 163, 146, 152, 17, 100, 154, 132, 24, 123, 11, 57, 66, 79, 26, 15, 137, 158, 116, 72, 8, 36, 14, 2, 48, 37, 38, 41, 36, 37, 21, 34, 32, 11,
+#> 62, 66, 79, 63, 16, 39, 20, 3, 11, 22, 43, 43, 69, 59, 57, 58, 68, 62, 63, 56, 55, 16, 54, 61, 2, 43, 44, 12, 16, 34, 40, 35, 37, 42, 28, 40, 29, 43, 41, 148, 160, 151, 151, 133, 160, 161, 157, 162, 161, 148, 125, 152, 148, 149, 155, 150, 144, 147, 105, 91, 131, 119, 29, 15, 129, 160, 159, 160, 160, 137, 160, 122, 72, 31, 66, 52, 133, 148, 126, 114, 98, 80, 85, 151, 140, 106, 108, 79, 50, 5, 3, 121, 121, 140, 132, 151, 158, 162, 156, 160, 134, 150, 153, 13, 4, 112, 142, 126, 139, 46, 135, 27, 121,
+#> 159, 119, 34, 2, 2, 3, 5, 50, 54, 42, 38, 48, 46, 37, 37, 53, 33, 157, 136, 162, 156, 148, 149, 156, 159, 160, 154, 160, 163, 162, 162, 162, 159, 163, 162, 107, 162, 151, 26, 95, 119, 72, 63, 157, 160, 143, 152, 133, 108, 135, 56, 75, 115, 66, 3, 31, 11, 30, 38, 42, 33, 39, 37, 26, 38, 38, 34, 37, 25, 34, 11, 2, 18, 49, 99, 138, 157, 157, 162, 160, 155, 149, 121, 134, 147, 103, 92, 45, 21, 40, 40, 42, 41, 40, 42, 46, 27, 35, 37, 40, 31, 34, 25, 33, 22, 5, 50, 45, 46, 36, 41, 41, 43, 20, 45, 3, 31,
+#> 90, 150, 142, 121, 139, 93, 51, 33, 63, 111, 99, 117, 38, 59, 17, 24, 75, 29, 7, 95, 154, 162, 162, 161, 164, 155, 161, 162, 160, 154, 154, 133, 149, 117, 40, 92, 135, 79, 115, 129, 118, 14, 130, 47, 41, 9, 7, 161, 149, 159, 146, 128, 153, 157, 126, 10, 146, 127, 131, 67, 10, 162, 161, 141, 122, 152, 118, 122, 155, 148, 72, 128, 119, 85, 54, 67, 118, 122, 138, 114, 157, 156, 149, 38, 31, 22, 9, 38, 44, 9, 13, 153, 124, 150, 155, 142, 158, 113, 162, 163, 100, 162, 157, 147, 139, 69, 122, 106, 11,
+#> 58, 154, 147, 161, 162, 151, 159, 161, 158, 107, 101, 45, 45, 78, 77, 58, 36, 13, 20, 143, 127, 57, 132, 110, 148, 128, 117, 152, 129, 113, 115, 12, 2, 113, 80, 142, 154, 148, 148, 135, 115, 159, 161, 161, 149, 141, 147, 114, 114, 26, 28, 34, 59, 58, 62, 50, 51, 43, 31, 1, 1, 7, 4, 100, 144, 130, 136, 155, 155, 143, 117, 148, 111, 110, 130, 120, 71, 48, 74, 153, 158, 163, 156, 160, 108, 137, 160, 160, 153, 150, 72, 34, 55, 144, 131, 155, 137, 155, 99, 21, 50, 8, 74, 157, 152, 136, 84, 95, 109, 119,
+#> 70, 73, 109, 101, 132, 137, 100, 87, 74, 4, 156, 149, 148, 120, 129, 46, 53, 11, 4, 80, 39, 28, 54, 42, 47, 48, 30, 53, 20, 39, 50, 35, 27, 43, 11, 31, 72, 8, 15, 42, 14, 37, 37, 36, 36, 39, 38, 35, 37, 38, 19, 6, 83, 13, 17, 140, 159, 142, 108, 127, 138, 159, 158, 96, 131, 12, 11, 49, 50, 3, 148, 15, 10, 108, 117, 144, 140, 134, 128, 145, 136, 141, 138, 148, 140, 124, 117, 63, 122, 126, 67, 38, 74, 17, 3, 15, 57, 33, 59, 82, 44, 23, 46, 54, 52, 67, 57, 43, 6, 26, 6, 40, 5, 26, 2, 43, 53, 84, 38,
+#> 20, 70, 78, 56, 11, 36, 11, 63, 45, 162, 142, 161, 159, 152, 27, 104, 130, 72, 44, 5, 13, 13, 10, 160, 158, 132, 149, 153, 113, 114, 83, 26, 17, 81, 153, 147, 152, 133, 82, 121, 114, 119, 76, 2, 21, 138, 137, 127, 126, 150, 150, 139, 146, 137, 64, 62, 21, 15, 4, 124, 140, 134, 144, 140, 125, 154, 152, 154, 128, 140, 114, 110, 134, 95, 50, 5, 122, 141, 96, 124, 104, 94, 49, 82, 42, 9, 15, 35, 38, 54, 47, 18, 27, 52, 40, 37, 18, 15, 75, 95, 106, 132, 154, 157, 121, 143, 154, 140, 160, 123, 154, 131,
+#> 2, 120, 19, 93, 3, 10, 34, 66, 57, 54, 38, 15, 41, 41, 48, 4, 47, 17, 24, 17, 33, 35, 38, 33, 16, 65, 55, 68, 5, 71, 54, 48, 10, 5, 12, 104, 99, 156, 160, 160, 158, 158, 136, 151, 158, 137, 139, 154, 148, 132, 151, 84, 69, 91, 71, 72, 77, 4, 123, 148, 52, 103, 155, 156, 159, 159, 157, 155, 157, 153, 160, 153, 136, 133, 141, 92, 120, 32, 46, 39, 23, 29, 9, 27, 33, 38, 39, 27, 33, 25, 22, 4, 3, 24, 42, 47, 40, 40, 29, 25, 4, 45, 41, 41, 38, 32, 9, 23, 4, 162, 159, 124, 152, 127, 146, 152, 158, 158,
+#> 158, 156, 157, 120, 45, 44, 16, 8, 119, 133, 151, 141, 150, 133, 141, 142, 146, 151, 140, 145, 83, 75, 75, 2, 12, 124, 154, 156, 139, 135, 132, 161, 157, 130, 2, 6, 149, 152, 160, 151, 73, 9, 114, 124, 32, 74, 13, 2, 137, 127, 123, 51, 147, 142, 149, 153, 143, 156, 155, 152, 110, 144, 93, 138, 129, 93, 127, 36, 38, 39, 42, 39, 36, 39, 32, 37, 35, 20, 13, 36, 33, 26, 23, 22, 34, 34, 35, 16, 12, 8, 10, 22, 127, 143, 113, 150, 138, 128, 138, 44, 134, 77, 45, 130, 11, 74, 12, 47, 90, 93, 90, 79, 6, 70,
+#> 67, 157, 105, 158, 156, 149, 157, 123, 145, 139, 150, 130, 148, 36, 30, 7, 60, 1, 39, 40, 43, 40, 39, 36, 38, 41, 37, 30, 28, 34, 37, 29, 19, 34, 33, 47, 72, 38, 33, 44, 43, 40, 32, 41, 38, 42, 45, 41, 42, 41, 32, 31, 20, 27, 3, 20, 33, 38, 38, 44, 42, 14, 33, 15, 5, 6, 158, 155, 143, 147, 159, 131, 115, 143, 135, 65, 47, 148, 128, 68, 92, 41, 106, 4, 30, 92, 145, 153, 149, 142, 139, 142, 157, 99, 52, 84, 75, 53, 154, 153, 146, 155, 131, 143, 131, 120, 114, 64, 9, 26, 154, 148, 158, 149, 147, 152,
+#> 160, 142, 135, 142, 120, 130, 114, 52, 119, 110, 79, 53, 37, 68, 134, 152, 151, 132, 152, 142, 27, 105, 29, 74, 60, 8, 20, 4, 37, 40, 36, 36, 44, 42, 38, 12, 21, 35, 23, 11, 44, 55, 57, 25, 7, 8, 79, 49, 150, 63, 71, 23, 61, 26, 150, 10, 149, 17, 52, 15, 25, 143, 146, 122, 143, 141, 96, 119, 108, 111, 72, 159, 114, 1, 139, 50, 32, 33, 162, 97, 1, 29, 30, 35, 34, 24, 35, 41, 41, 30, 36, 38, 39, 12, 4, 106, 150, 145, 160, 158, 154, 155, 149, 160, 153, 154, 145, 39, 59, 131, 56, 6, 1, 25, 4, 3, 34,
+#> 51, 88, 76, 77, 44, 49, 49, 42, 43, 7, 24, 28, 7, 99, 133, 103, 129, 50, 90, 103, 75, 11, 2, 32, 25, 38, 38, 28, 39, 41, 38, 35, 38, 38, 36, 26, 2, 20, 131, 148, 145, 142, 149, 142, 118, 157, 136, 1, 78, 24, 44, 11, 8, 69, 145, 150, 145, 150, 113, 154, 155, 152, 153, 144, 135, 101, 113, 64, 54, 37, 41, 149, 162, 142, 143, 125, 153, 136, 162, 139, 91, 47, 67, 10, 47, 124, 148, 158, 152, 147, 148, 144, 154, 71, 144, 134, 30, 4, 6, 135, 144, 126, 151, 144, 140, 74, 100, 103, 130, 130, 116, 60, 102,
+#> 53, 29, 159, 96, 135, 120, 142, 129, 153, 84, 152, 108, 26, 98, 9, 35, 154, 152, 149, 150, 135, 151, 148, 157, 134, 146, 139, 131, 143, 94, 153, 116, 143, 143, 132, 115, 1, 103, 139, 142, 123, 154, 157, 158, 147, 100, 129, 115, 85, 15, 9, 30, 35, 32, 34, 37, 41, 40, 39, 37, 35, 36, 34, 36, 38, 24, 38, 37, 34, 16, 10, 16, 6, 23, 9, 4, 4, 81, 78, 63, 110, 117, 141, 139, 146, 162, 155, 149, 32, 108, 123, 11, 48, 6, 30, 139, 129, 147, 137, 134, 136, 106, 92, 124, 21, 12, 53, 70, 69, 72, 59, 55, 70, 66,
+#> 75, 67, 11, 36, 17, 9, 8, 34, 90, 67, 70, 63, 7, 33, 5, 55, 27, 9, 80, 154, 133, 162, 155, 131, 158, 38, 72, 121, 88, 61, 44, 42, 35, 35, 5, 35, 42, 36, 33, 39, 32, 47, 41, 40, 35, 35, 36, 8, 15, 19, 113, 146, 148, 82, 29, 102, 118, 132, 150, 128, 71, 106, 97, 25, 54, 33, 7, 1, 37, 120, 133, 134, 143, 69, 82, 90, 78, 11, 19, 3, 4, 12, 157, 147, 147, 153, 130, 141, 111, 119, 137, 98, 25, 47, 98, 155, 156, 135, 152, 154, 152, 129, 139, 52, 96, 111, 138, 150, 95, 141, 146, 74, 21, 26, 132, 125, 140,
+#> 147, 144, 157, 152, 149, 154, 97, 8, 43, 36, 35, 40, 38, 39, 27, 1, 25, 15, 31, 43, 36, 37, 38, 39, 40, 35, 28, 16, 18, 13, 14, 16, 31, 37, 38, 42, 35, 29, 4, 35, 26, 5, 17, 43, 110, 92, 152, 152, 149, 129, 95, 147, 110, 15, 49, 22, 12, 6, 39, 27, 38, 40, 39, 37, 38, 35, 37, 31, 18, 31, 19, 33, 28, 19, 48, 159, 147, 143, 148, 146, 132, 153, 142, 141, 151, 107, 99, 125, 98, 40, 81, 158, 157, 155, 153, 160, 150, 145, 99, 158, 26, 130, 146, 86, 45, 22, 128, 157, 156, 157, 142, 153, 143, 160, 129, 146,
+#> 158, 149, 152, 153, 98, 42, 141, 43, 19, 33, 151, 111, 123, 157, 142, 115, 106, 106, 34, 118, 107, 71, 53, 87, 111, 121, 155, 17, 110, 150, 156, 157, 162, 149, 158, 107, 157, 131, 135, 101, 97, 1, 10, 145, 151, 132, 118, 111, 61, 61, 100, 39, 64, 109, 142, 156, 147, 152, 110, 98, 23, 115, 137, 139, 144, 120, 63, 64, 11, 21, 152, 159, 146, 153, 160, 156, 147, 147, 154, 146, 58, 74, 100, 50, 65, 9, 31, 95, 106, 141, 102, 95, 80, 93, 86, 107, 50, 35, 2, 29, 36, 9, 27, 44, 38, 36, 38, 26, 39, 40, 39,
+#> 38, 23, 37, 22, 36, 14, 5, 5, 25, 127, 146, 158, 153, 147, 148, 148, 152, 146, 148, 150, 148, 124, 78, 26, 42, 30, 129, 128, 138, 136, 149, 151, 133, 114, 152, 85, 56, 47, 21, 24, 38, 7, 50, 83, 62, 15, 27, 9, 9, 30, 3, 31, 26, 8, 38, 41, 43, 38, 22, 66, 58, 54, 67, 64, 61, 40, 20, 40, 8, 10, 157, 122, 133, 10, 147, 144, 160, 149, 157, 149, 146, 141, 153, 132, 127, 141, 90, 134, 123, 116, 16, 38, 65, 82, 160, 158, 158, 128, 147, 142, 151, 133, 58, 66, 53, 13, 32, 46, 49, 36, 42, 39, 40, 41, 38, 41,
+#> 41, 37, 15, 22, 32, 34, 37, 32, 10, 24, 24, 32, 14, 16, 18, 125, 129, 113, 93, 100, 49, 5, 2, 14, 131, 135, 52, 79, 134, 152, 157, 91, 131, 96, 135, 138, 102, 153, 125, 135, 76, 103, 137, 134, 62, 25, 4, 54, 145, 132, 154, 158, 109, 77, 151, 158, 159, 156, 162, 153, 45, 28, 1, 90, 161, 139, 139, 160, 131, 150, 141, 50, 132, 137, 82, 138, 98, 110, 83, 28, 37, 145, 159, 152, 122, 162, 136, 156, 154, 156, 147, 147, 103, 142, 147, 133, 72, 14, 7, 34, 35, 34, 33, 35, 26, 35, 13, 35, 17, 33, 25, 19, 68,
+#> 35, 106, 127, 147, 120, 158, 126, 130, 64, 133, 90, 104, 49, 71, 4, 18, 19, 102, 27, 134, 77, 29, 10, 36, 6, 157, 150, 153, 141, 141, 145, 139, 6, 150, 113, 128, 96, 156, 88, 12, 25, 38, 106, 95, 111, 82, 28, 27, 49, 71, 63, 50, 59, 51, 66, 49, 64, 72, 59, 67, 10, 49, 48, 11, 34, 11, 19, 73, 42, 10, 58, 71, 65, 61, 65, 53, 57, 56, 29, 8, 51, 2, 67, 144, 142, 147, 159, 135, 147, 134, 149, 151, 134, 137, 149, 150, 98, 85, 8, 77, 55, 60, 30, 7, 133, 162, 160, 150, 144, 52, 144, 153, 150, 100, 145, 120,
+#> 116, 144, 98, 8, 76, 45, 113, 138, 131, 144, 125, 19, 66, 96, 90, 119, 86, 120, 57, 38, 31, 59, 72, 1, 150, 153, 154, 143, 127, 152, 97, 45, 75, 94, 28, 5, 1, 23, 39, 41, 47, 24, 65, 59, 36, 56, 45, 51, 43, 11, 9, 110, 94, 114, 133, 133, 33, 148, 160, 101, 150, 124, 119, 68, 20, 148, 154, 116, 156, 148, 129, 156, 155, 101, 162, 132, 147, 97, 123, 44, 45, 4, 5, 50, 46, 149, 152, 126, 156, 161, 153, 152, 137, 149, 94, 69, 17, 11, 47, 162, 162, 155, 153, 152, 162, 146, 160, 158, 159, 152, 130, 78, 32,
+#> 3, 34, 12, 35, 39, 40, 30, 40, 41, 39, 39, 13, 21, 18, 23, 5, 24, 12, 12, 89, 125, 161, 160, 156, 44, 92, 144, 159, 160, 154, 102, 141, 142, 131, 151, 151, 150, 144, 107, 1, 16, 34, 27, 35, 42, 41, 10, 98, 81, 91, 129, 162, 160, 84, 149, 153, 155, 153, 130, 82, 153, 131, 89, 76, 105, 37, 21, 4, 24, 66, 65, 92, 106, 58, 24, 30, 4, 12, 54, 90, 18, 20, 3, 34, 81, 96, 114, 156, 160, 162, 162, 162, 162, 163, 110, 162, 100, 161, 162, 155, 27, 13, 130, 133, 140, 122, 76, 136, 135, 144, 26, 133, 100, 32,
+#> 30, 37, 39, 42, 43, 38, 39, 37, 41, 39, 36, 22, 21, 19, 28, 47, 94, 120, 139, 150, 148, 149, 149, 122, 123, 103, 59, 53, 38, 29, 42, 38, 39, 26, 34, 39, 44, 29, 16, 6, 11, 101, 130, 119, 89, 160, 140, 152, 156, 153, 149, 156, 106, 147, 143, 154, 155, 90, 104, 84, 96, 48, 144, 99, 97, 112, 34, 64, 6, 59, 22, 151, 152, 152, 158, 154, 153, 116, 99, 89, 113, 121, 58, 86, 131, 145, 151, 153, 146, 100, 52, 160, 94, 160, 134, 133, 107, 40, 150, 116, 72, 85, 43, 122, 151, 137, 58, 27, 70, 13, 132, 162, 158,
+#> 160, 154, 145, 160, 150, 102, 148, 154, 151, 158, 160, 147, 108, 42, 44, 40, 31, 53, 39, 22, 25, 22, 8, 7, 17, 103, 149, 147, 155, 141, 140, 144, 135, 94, 131, 90, 45, 63, 53, 59, 17, 29, 36, 47, 17, 9, 21, 56, 56, 25, 46, 41, 1, 60, 45, 48, 65, 62, 76, 76, 70, 78, 67, 54, 66, 47, 50, 33, 47, 21, 128, 130, 142, 140, 122, 85, 69, 137, 82, 154, 130, 103, 34, 110, 111, 87, 21, 19, 41, 46, 33, 34, 38, 18, 21, 43, 35, 38, 35, 38, 32, 32, 30, 25, 9, 6, 15, 145, 132, 129, 150, 147, 110, 76, 138, 117, 142,
+#> 124, 112, 111, 87, 27, 117, 90, 21, 147, 154, 161, 155, 157, 150, 159, 151, 82, 7, 125, 144, 135, 99, 17, 146, 139, 155, 148, 143, 94, 119, 97, 77, 105, 6, 33, 23, 17, 37, 35, 25, 2, 32, 34, 6, 8, 7, 35, 38, 26, 37, 24, 22, 26, 32, 6, 31, 11, 3, 4, 3, 22, 96, 157, 158, 150, 160, 155, 157, 158, 158, 159, 145, 89, 103, 122, 129, 124, 137, 126, 112, 80, 24, 144, 153, 160, 163, 158, 124, 108, 145, 155, 159, 140, 157, 108, 135, 56, 8, 127, 116, 118, 161, 151, 155, 159, 139, 149, 160, 103, 162, 138, 88,
+#> 126, 95, 20, 46, 40, 40, 28, 38, 41, 25, 13, 28, 8, 28, 150, 161, 85, 161, 149, 149, 155, 137, 106, 104, 159, 144, 125, 4, 129, 151, 143, 140, 158, 147, 155, 121, 154, 133, 136, 163, 102, 160, 157, 28, 91, 35, 61, 54, 73, 148, 138, 159, 148, 158, 139, 67, 73, 144, 156, 160, 162, 153, 101, 144, 157, 119, 13, 36, 21, 39, 62, 31, 72, 63, 36, 64, 32, 56, 57, 62, 50, 45, 40, 46, 11, 31, 44, 30, 39, 36, 16, 1, 5, 44, 66, 65, 68, 65, 58, 58, 45, 24, 31, 9, 9, 104, 36, 59, 17, 106, 134, 144, 158, 158, 121,
+#> 144, 108, 151, 157, 146, 129, 15, 72, 29, 76, 159, 17, 142, 154, 153, 160, 159, 151, 128, 96, 134, 106, 52, 89, 27, 118, 45, 22, 132, 155, 140, 149, 149, 150, 151, 102, 139, 131, 110, 115, 140, 61, 24, 38, 76, 18, 119, 133, 128, 146, 73, 147, 152, 148, 108, 162, 126, 162, 159, 152, 154, 149, 146, 123, 101, 120, 138, 68, 148, 144, 140, 103, 152, 50, 108, 119, 79, 89, 97, 6, 25, 39, 34, 31, 25, 33, 38, 38, 29, 36, 22, 31, 31, 33, 37, 36, 20, 7, 30, 34, 32, 12, 11, 13, 33, 35, 10, 38, 43, 36, 41, 40,
+#> 39, 33, 33, 40, 35, 35, 33, 34, 33, 32, 23, 27, 7, 31, 33, 5, 29, 34, 35, 16, 28, 63, 47, 78, 69, 29, 41, 23, 30, 62, 82, 57, 50, 34, 7, 8, 58, 71, 23, 41, 8, 22, 51, 14, 30, 31, 11, 3, 4, 10, 10, 4, 77, 17, 58, 25, 38, 12, 19, 21, 7, 28, 24, 36, 40, 58, 10, 13, 133, 159, 159, 139, 128, 154, 117, 89, 144, 123, 104, 155, 124, 115, 157, 124, 142, 131, 152, 145, 17, 70, 99, 61, 106, 148, 126, 149, 162, 156, 101, 124, 101, 159, 157, 106, 112, 112, 18, 4, 39, 34, 35, 31, 33, 18, 32, 24, 30, 29, 35, 20,
+#> 13, 32, 34, 32, 33, 34, 33, 32, 3, 29, 17, 79, 58, 30, 118, 155, 137, 138, 141, 74, 58, 147, 99, 19, 96, 102, 8, 18, 158, 147, 146, 143, 21, 135, 103, 60, 136, 159, 109, 38, 14, 128, 26, 29, 18, 36, 16, 145, 146, 97, 121, 132, 132, 119, 141, 76, 143, 142, 139, 150, 144, 128, 122, 131, 40, 25, 88, 132, 148, 154, 158, 95, 146, 101, 127, 118, 120, 127, 80, 59, 122, 69, 25, 106, 46, 21, 30, 51, 99, 111, 152, 152, 143, 127, 154, 94, 145, 146, 129, 149, 151, 154, 150, 135, 82, 16, 33, 106, 78, 145, 123,
+#> 127, 62, 70, 58, 112, 92, 110, 132, 113, 57, 39, 27, 110, 120, 152, 162, 132, 136, 34, 108, 85, 146, 110, 139, 122, 28, 6, 3, 13, 29, 127, 159, 149, 142, 112, 153, 149, 151, 153, 103, 147, 149, 100, 111, 83, 160, 161, 159, 158, 99, 151, 156, 162, 156, 137, 160, 161, 160, 155, 153, 156, 154, 108, 113, 64, 88, 46, 9, 24, 139, 157, 155, 151, 103, 148, 159, 138, 139, 130, 153, 157, 118, 147, 149, 143, 121, 75, 79, 42, 30, 125, 147, 134, 153, 138, 93, 144, 104, 142, 143, 141, 120, 110, 145, 26, 93, 124,
+#> 90, 7, 145, 126, 36, 143, 143, 80, 155, 141, 142, 26, 17, 27, 9, 2, 21, 25, 27, 30, 39, 41, 42, 28, 39, 37, 31, 34, 35, 21, 35, 29, 30, 35, 30, 34, 33, 32, 30, 27, 27, 13, 114, 158, 152, 154, 145, 153, 155, 109, 11, 33, 7, 93, 62, 2, 5, 82, 133, 152, 161, 152, 157, 150, 150, 152, 123, 145, 100, 137, 153, 132, 143, 76, 73, 78, 21, 36, 41, 38, 38, 41, 35, 38, 44, 16, 12, 4, 20, 31, 43, 25, 9, 36, 32, 15, 4, 53, 153, 155, 154, 118, 80, 141, 126, 148, 148, 147, 148, 110, 142, 144, 80, 32, 40, 154, 157,
+#> 158, 158, 123, 141, 141, 73, 59, 46, 131, 11, 11, 7, 36, 37, 34, 37, 23, 34, 32, 30, 34, 30, 22, 13, 15, 89, 143, 114, 77, 105, 86, 132, 120, 129, 97, 135, 104, 95, 41, 14, 64, 129, 161, 159, 161, 159, 103, 160, 95, 55, 154, 158, 149, 154, 95, 75, 43, 11, 142, 145, 155, 117, 134, 151, 153, 141, 58, 128, 147, 16, 72, 99, 59, 37, 47, 12, 94, 127, 151, 146, 86, 22, 48, 111, 86, 11, 10, 42, 28, 46, 37, 40, 34, 42, 38, 42, 41, 39, 38, 44, 45, 44, 40, 22, 35, 34, 32, 33, 34, 1, 22, 3, 11, 139, 127, 145,
+#> 109, 152, 161, 143, 152, 144, 149, 115, 148, 132, 138, 130, 119, 92, 84, 89, 121, 124, 79, 140, 104, 32, 130, 141, 60, 150, 89, 131, 153, 149, 161, 158, 160, 162, 66, 152, 151, 155, 161, 158, 162, 68, 38, 109, 70, 112, 104, 78, 54, 107, 147, 161, 154, 127, 149, 143, 96, 156, 149, 160, 122, 140, 158, 162, 160, 158, 130, 150, 127, 8, 26, 136, 156, 143, 127, 99, 157, 135, 57, 126, 65, 131, 150, 142, 115, 140, 81, 2, 20, 36, 40, 39, 40, 20, 36, 20, 34, 15, 29, 16, 7, 34, 30, 5, 64, 42, 52, 62, 64, 62,
+#> 60, 48, 70, 60, 71, 58, 16, 38, 14, 12, 30, 121, 106, 123, 160, 107, 150, 153, 106, 155, 160, 148, 154, 134, 63, 132, 156, 116, 153, 159, 129, 142, 162, 129, 97, 148, 156, 148, 67, 84, 155, 143, 21, 74, 34, 15, 134, 145, 109, 132, 138, 112, 72, 138, 18, 97, 109, 72, 17, 21, 154, 158, 152, 152, 118, 141, 94, 149, 88, 31, 98, 125, 81, 108, 76, 17, 56, 145, 143, 137, 157, 158, 159, 162, 105, 140, 152, 141, 155, 154, 156, 149, 112, 20, 150, 156, 143, 77, 46, 8, 1, 102, 118, 137, 145, 157, 154, 158, 162,
+#> 90, 103, 157, 144, 134, 142, 160, 108, 20, 92, 17, 107, 120, 27, 69, 131, 145, 143, 69, 161, 141, 155, 124, 120, 36, 4, 13, 50, 60, 58, 71, 38, 23, 13, 50, 1, 6, 8, 5, 16, 148, 150, 101, 117, 142, 8, 12, 14, 5, 153, 155, 101, 162, 162, 140, 162, 162, 144, 95, 136, 141, 109, 63, 46, 1, 2, 40, 44, 14, 34, 36, 20, 15, 20, 29, 35, 33, 37, 5, 20, 36, 29, 16, 22, 18, 117, 131, 130, 119, 130, 150, 157, 118, 61, 120, 145, 127, 84, 68, 85, 69, 115, 142, 162, 148, 155, 154, 152, 149, 159, 156, 103, 156, 151,
+#> 111, 78, 103, 41, 150, 158, 162, 133, 56, 4, 142, 130, 47, 67, 129, 143, 110, 41, 135, 112, 121, 134, 123, 10, 8, 58, 56, 119, 145, 81, 100, 149, 100, 147, 158, 144, 6, 48, 150, 155, 162, 162, 103, 158, 97, 48, 117, 24, 34, 118, 36, 34, 4, 38, 39, 32, 18, 20, 27, 40, 36, 44, 36, 38, 37, 24, 35, 38, 38, 32, 3, 25, 19, 8, 5, 38, 15, 4, 43, 57, 51, 54, 60, 41, 56, 58, 45, 55, 65, 57, 34, 34, 34, 25, 24, 27, 39, 42, 34, 17, 31, 30, 32, 49, 15, 60, 121, 159, 107, 151, 130, 153, 152, 98, 82, 49, 98, 12,
+#> 13, 127, 154, 161, 102, 136, 137, 128, 141, 156, 146, 147, 112, 115, 113, 132, 105, 17, 4, 24, 17, 15, 29, 33, 23, 29, 16, 14, 19, 139, 142, 146, 105, 157, 142, 139, 149, 151, 151, 128, 121, 146, 101, 29, 112, 76, 74, 66, 90, 93, 36, 90, 156, 157, 128, 105, 58, 88, 143, 124, 32, 9, 9, 144, 91, 154, 157, 140, 154, 100, 154, 145, 159, 149, 132, 139, 130, 50, 92, 101, 95, 159, 156, 158, 110, 140, 159, 124, 158, 153, 158, 153, 155, 143, 150, 132, 141, 98, 44, 82, 32, 75, 40, 72, 69, 72, 84, 62, 47, 20,
+#> 33, 63, 5, 131, 48, 22, 59, 41, 66, 46, 19, 13, 24, 37, 20, 51, 40, 56, 25, 12, 85, 143, 144, 96, 133, 155, 147, 140, 91, 130, 123, 124, 133, 119, 24, 69, 10, 40, 70, 14, 94, 58, 92, 100, 115, 132, 128, 139, 156, 107, 159, 125, 131, 101, 103, 42, 58, 113, 139, 145, 149, 152, 36, 102, 140, 150, 101, 136, 144, 120, 16, 69, 102, 65, 69, 20, 35, 35, 35, 34, 33, 32, 20, 36, 37, 16, 34, 34, 34, 6, 31, 37, 7, 7, 31, 88, 136, 147, 71, 89, 80, 38, 96, 68, 113, 84, 102, 49, 90, 33, 6, 6, 27, 41, 24, 12, 34,
+#> 37, 34, 34, 35, 14, 29, 8, 14, 43, 57, 78, 51, 46, 48, 54, 56, 48, 11, 38, 2, 11, 152, 159, 158, 145, 153, 159, 150, 157, 85, 150, 159, 146, 145, 97, 45, 10, 25, 38, 36, 35, 35, 39, 38, 23, 34, 35, 2, 32, 8, 29, 36, 14, 5, 20, 3, 46, 122, 131, 92, 116, 143, 104, 2, 89, 158, 108, 149, 145, 142, 143, 153, 95, 140, 65, 85, 136, 134, 117, 90, 44, 87, 112, 148, 32, 88, 152, 121, 31, 92, 123, 72, 30, 3, 33, 42, 48, 3, 31, 33, 32, 32, 30, 34, 23, 21, 33, 54, 29, 3, 15, 33, 31, 64, 74, 74, 60, 60, 55, 53,
+#> 61, 54, 51, 7, 13, 10, 121, 157, 151, 102, 128, 80, 151, 98, 151, 151, 150, 148, 134, 5, 135, 4, 118, 91, 80, 158, 109, 138, 145, 157, 103, 121, 28, 120, 60, 7, 28, 28, 44, 25, 37, 44, 35, 36, 35, 36, 34, 24, 36, 35, 34, 27, 23, 5, 25, 75, 98, 150, 160, 144, 137, 31, 152, 59, 44, 162, 136, 115, 43, 35, 54, 94, 135, 117, 125, 94, 105, 96, 42, 82, 113, 74, 53, 50, 4, 33, 53, 45, 34, 32, 24, 30, 3, 22, 6, 19, 18, 151, 104, 156, 104, 162, 162, 162, 162, 160, 159, 156, 154, 97, 57, 153, 18, 26, 23, 160,
+#> 162, 162, 161, 162, 162, 161, 162, 161, 162, 162, 162, 112, 144, 163, 162, 161, 86, 83, 128, 31, 150, 155, 145, 136, 157, 157, 160, 158, 155, 158, 143, 57, 7, 18, 11, 140, 64, 147, 131, 152, 146, 122, 21, 80, 10, 1, 61, 129, 150, 142, 120, 145, 100, 153, 95, 146, 120, 140, 133, 4, 96, 87, 148, 100, 137, 153, 141, 131, 24, 21, 29, 35, 29, 30, 17, 43, 10, 53, 44, 50, 44, 25, 52, 40, 31, 35, 3, 10, 6, 21, 16, 2, 3, 34, 35, 26, 38, 25, 34, 29, 28, 7, 60, 17, 121, 99, 137, 156, 162, 103, 158, 106, 46,
+#> 35, 135, 44, 57, 20, 36, 29, 38, 36, 35, 36, 38, 34, 33, 33, 33, 9, 21, 4, 19, 17, 17, 100, 62, 156, 130, 145, 120, 28, 134, 48, 43, 134, 135, 122, 84, 9, 94, 35, 17, 38, 35, 35, 40, 30, 40, 38, 23, 35, 36, 31, 8, 1, 2, 7, 28, 35, 34, 33, 34, 21, 15, 34, 34, 30, 29, 10, 5, 5, 6, 25, 6, 43, 71, 59, 21, 91, 136, 124, 119, 92, 125, 128, 109, 132, 122, 60, 77, 79, 62, 61, 8, 2, 25, 43, 39, 36, 35, 31, 35, 2, 26, 30, 26, 33, 31, 16, 19, 21, 4, 36, 22, 33, 27, 13, 156, 158, 156, 153, 154, 132, 155, 157,
+#> 155, 158, 158, 117, 57, 150, 135, 8, 66, 138, 151, 147, 147, 144, 116, 149, 141, 143, 141, 133, 126, 40, 91, 67, 31, 9, 123, 147, 145, 152, 124, 153, 137, 58, 29, 125, 131, 138, 130, 45, 67, 123, 122, 120, 132, 14, 80, 83, 150, 162, 106, 158, 145, 88, 27, 90, 137, 150, 105, 2, 3, 54, 47, 58, 68, 68, 15, 3, 38, 25, 3, 20, 145, 139, 116, 86, 30, 59, 75, 51, 22, 83, 17, 122, 147, 111, 136, 154, 153, 134, 152, 139, 43, 32, 29, 32, 63, 11, 101, 24, 104, 153, 158, 161, 149, 147, 155, 156, 155, 144, 143,
+#> 143, 97, 126, 132, 104, 123, 90, 114, 100, 147, 151, 158, 152, 152, 155, 128, 135, 122, 74, 31, 162, 151, 155, 154, 155, 30, 123, 153, 134, 105, 10, 33, 84, 101, 153, 149, 148, 143, 141, 143, 85, 125, 107, 69, 6, 83, 117, 132, 107, 120, 133, 157, 153, 157, 160, 107, 155, 160, 160, 141, 141, 126, 38, 35, 80, 49, 136, 154, 5, 84, 106, 32, 95, 136, 149, 146, 95, 85, 44, 97, 117, 99, 145, 148, 120, 142, 143, 141, 105, 53, 15, 13, 30, 6, 27, 20, 35, 36, 32, 50, 9, 45, 8, 41, 13, 6, 15, 88, 156, 156, 160,
+#> 150, 151, 139, 109, 145, 130, 155, 144, 115, 101, 133, 59, 74, 109, 58, 4, 47, 98, 18, 40, 72, 66, 69, 65, 66, 63, 64, 64, 11, 53, 67, 70, 8, 55, 41, 52, 11, 43, 25, 12, 51, 83, 69, 128, 149, 154, 119, 128, 150, 71, 89, 132, 16, 116, 98, 70, 67, 55, 52, 53, 13, 75, 11, 63, 80, 74, 64, 45, 63, 32, 10, 10, 122, 122, 143, 121, 108, 93, 68, 107, 28, 26, 36, 46, 35, 9, 12, 38, 39, 36, 38, 28, 13, 23, 152, 155, 135, 157, 140, 142, 140, 145, 40, 31, 35, 33, 25, 34, 19, 35, 27, 33, 30, 7, 29, 20, 23, 26,
+#> 1, 18, 8, 54, 86, 158, 154, 160, 157, 133, 158, 141, 134, 128, 122, 110, 135, 116, 149, 127, 111, 36, 71, 4, 26, 27, 32, 30, 1, 20, 21, 36, 36, 35, 37, 41, 30, 31, 20, 7, 91, 153, 159, 162, 141, 144, 158, 102, 152, 157, 134, 97, 128, 21, 32, 36, 25, 18, 48, 43, 49, 43, 39, 32, 30, 33, 35, 39, 20, 28, 17, 19, 24, 9, 16, 6, 31, 22, 3, 10, 22, 140, 125, 154, 133, 129, 119, 136, 137, 48, 30, 5, 71, 158, 156, 160, 155, 134, 153, 159, 154, 161, 151, 150, 133, 113, 97, 57, 45, 18, 61, 25, 18, 75, 66, 68,
+#> 63, 62, 63, 63, 65, 47, 57, 14, 46, 58, 11, 150, 159, 149, 156, 155, 160, 154, 12, 134, 100, 122, 150, 142, 83, 12, 92, 63, 151, 154, 151, 153, 145, 124, 72, 71, 92, 104, 75, 40, 33, 6, 60, 39, 159, 157, 159, 156, 156, 153, 142, 149, 155, 102, 24, 98, 126, 150, 153, 156, 80, 112, 151, 148, 153, 103, 82, 75, 34, 141, 82, 161, 156, 147, 160, 145, 132, 158, 96, 50, 32, 103, 141, 140, 118, 94, 127, 143, 44, 93, 104, 107, 28, 72, 24, 32, 23, 124, 159, 143, 158, 154, 144, 72, 45, 14, 76, 103, 135, 89,
+#> 145, 159, 152, 141, 86, 15, 151, 27, 119, 70, 32, 6, 16, 18, 32, 34, 36, 37, 30, 17, 9, 23, 6, 25, 8, 33, 139, 156, 158, 137, 150, 86, 62, 12, 21, 15, 33, 36, 35, 35, 31, 35, 32, 29, 24, 23, 34, 34, 33, 30, 32, 33, 29, 33, 33, 32, 19, 18, 18, 6, 23, 37, 24, 31, 36, 38, 36, 32, 33, 32, 2, 9, 145, 157, 162, 160, 157, 154, 133, 130, 154, 152, 130, 20, 82, 90, 137, 141, 148, 37, 91, 113, 5, 25, 139, 128, 110, 155, 158, 159, 137, 129, 21, 153, 84, 30, 128, 161, 161, 157, 158, 159, 146, 152, 160, 156,
+#> 108, 137, 15, 88, 161, 163, 146, 154, 140, 161, 145, 155, 48, 94, 104, 108, 120, 138, 142, 28, 48, 56, 130, 151, 150, 142, 148, 125, 2, 88, 78, 12, 5, 32, 35, 39, 40, 32, 38, 26, 21, 10, 2, 33, 17, 74, 75, 68, 47, 67, 35, 38, 59, 72, 65, 29, 157, 159, 158, 65, 131, 154, 97, 22, 60, 111, 102, 96, 108, 151, 113, 37, 61, 76, 18, 100, 158, 151, 152, 158, 93, 49, 106, 30, 22, 82, 106, 137, 59, 80, 140, 153, 146, 79, 61, 6, 9, 62, 92, 81, 133, 144, 135, 52, 95, 93, 10, 40, 46, 41, 32, 34, 35, 31, 22, 27,
+#> 7, 8, 17, 22, 35, 35, 36, 37, 36, 35, 24, 12, 35, 35, 35, 29, 6, 3, 6, 15, 64, 70, 40, 37, 68, 65, 57, 28, 40, 68, 56, 49, 46, 29, 35, 24, 37, 35, 35, 24, 10, 33, 34, 33, 35, 18, 31, 18, 9, 23, 25, 67, 149, 159, 159, 110, 162, 121, 153, 160, 161, 77, 133, 42, 111, 50, 79, 6, 12, 110, 121, 120, 68, 96, 108, 95, 37, 1, 59, 46, 57, 56, 132, 129, 135, 131, 127, 89, 76, 23, 108, 37, 129, 42, 131, 58, 92, 74, 125, 140, 111, 64, 160, 152, 13, 140, 105, 118, 154, 155, 103, 158, 158, 160, 115, 130, 161, 135,
+#> 126, 11, 8, 134, 88, 7, 37, 80, 139, 136, 133, 89, 131, 94, 44, 150, 134, 18, 151, 155, 143, 156, 154, 139, 27, 47, 104, 130, 105, 51, 155, 153, 89, 97, 17, 146, 139, 129, 100, 152, 106, 139, 101, 81, 136, 97, 15, 109, 89, 133, 126, 108, 49, 6, 19, 7, 135, 122, 87, 44, 92, 135, 121, 76, 28, 26, 10, 18, 160, 161, 145, 160, 157, 86, 51, 143, 153, 29, 47, 103, 59, 76, 15, 69, 45, 43, 63, 36, 36, 36, 21, 33, 27, 33, 33, 34, 25, 5, 30, 34, 25, 3, 43, 43, 41, 27, 21, 32, 23, 11, 36, 26, 14, 26, 24, 16,
+#> 34, 36, 34, 35, 33, 30, 23, 33, 28, 9, 24, 26, 33, 54, 60, 51, 63, 67, 69, 64, 45, 52, 63, 57, 50, 6, 122, 104, 130, 114, 129, 128, 104, 103, 114, 145, 122, 124, 101, 8, 45, 37, 37, 40, 36, 35, 4, 21, 35, 34, 21, 26, 33, 32, 34, 32, 10, 20, 10, 67, 126, 160, 158, 153, 160, 161, 140, 145, 74, 21, 29, 159, 122, 156, 125, 156, 153, 146, 100, 101, 146, 74, 146, 134, 47, 126, 101, 137, 146, 137, 157, 154, 130, 136, 138, 154, 83, 105, 17, 63, 6, 6, 100, 105, 151, 157, 150, 152, 153, 69, 54, 109, 64, 54,
+#> 67, 74, 68, 70, 60, 55, 52, 31, 35, 47, 48, 51, 59, 61, 46, 62, 58, 38, 52, 31, 16, 147, 84, 138, 40, 103, 158, 110, 137, 155, 121, 96, 110, 80, 137, 82, 148, 153, 96, 148, 68, 20, 5, 54, 16, 149, 160, 160, 149, 128, 152, 150, 157, 146, 35, 144, 112, 112, 78, 42, 1, 25, 125, 103, 125, 108, 95, 15, 40, 17, 31, 125, 158, 145, 159, 147, 49, 146, 95, 120, 77, 24, 105, 147, 157, 152, 155, 107, 95, 120, 103, 143, 159, 154, 153, 141, 49, 72, 104, 110, 7, 75, 63, 141, 159, 163, 160, 157, 128, 139, 108, 61,
+#> 80, 159, 153, 28, 72, 60, 114, 93, 1, 2, 20, 5, 33, 39, 36, 14, 19, 31, 28, 18, 8, 33, 6, 41, 125, 151, 97, 158, 123, 140, 100, 110, 131, 152, 73, 145, 161, 102, 45, 145, 70, 111, 8, 23, 2, 106, 74, 105, 123, 124, 139, 131, 135, 127, 129, 67, 35, 1, 32, 45, 46, 8, 32, 4, 42, 29, 8, 37, 37, 36, 36, 35, 31, 26, 22, 16, 111, 150, 162, 159, 154, 148, 144, 132, 110, 123, 117, 110, 149, 77, 79, 51, 4, 15, 32, 32, 36, 35, 21, 22, 17, 19, 15, 32, 26, 19, 13, 13, 4, 39, 147, 152, 158, 151, 147, 148, 147,
+#> 143, 109, 110, 51, 25, 116, 124, 135, 111, 23, 85, 75, 2, 9, 20, 46, 77, 67, 43, 21, 62, 70, 53, 29, 14, 13, 25, 35, 20, 19, 5, 39, 42, 34, 32, 34, 35, 34, 3, 17, 12, 34, 32, 27, 22, 32, 28, 50, 34, 35, 31, 18, 7, 2, 7, 108, 62, 69, 148, 154, 140, 113, 99, 93, 95, 27, 37, 20, 51, 10, 34, 13, 37, 52, 35, 71, 27, 68, 8, 51, 51, 29, 13, 37, 55, 10, 64, 64, 72, 60, 50, 16, 3, 20, 43, 9, 34, 11, 64, 61, 13, 28, 116, 101, 123, 30, 5, 46, 102, 37, 26, 12, 3, 107, 154, 161, 153, 153, 152, 68, 83, 113, 144,
+#> 159, 152, 151, 144, 158, 49, 97, 146, 86, 27, 33, 78, 90, 82, 86, 117, 135, 154, 157, 152, 107, 134, 143, 17, 113, 158, 156, 162, 159, 161, 27, 124, 158, 110, 56, 70, 46, 96, 25, 14, 27, 20, 94, 122, 63, 43, 107, 61, 14, 54, 27, 116, 126, 88, 157, 148, 153, 154, 156, 100, 72, 93, 87, 50, 134, 150, 149, 162, 155, 114, 141, 162, 162, 160, 160, 101, 155, 145, 153, 156, 155, 145, 141, 25, 35, 31, 29, 32, 34, 31, 35, 25, 32, 35, 25, 34, 33, 34, 22, 18, 14, 74, 150, 95, 155, 138, 146, 142, 18, 7, 88, 127,
+#> 82, 114, 18, 62, 36, 42, 62, 98, 88, 72, 8, 53, 127, 141, 145, 108, 27, 139, 138, 75, 43, 136, 44, 43, 6, 23, 25, 34, 23, 38, 31, 32, 25, 35, 38, 36, 33, 35, 36, 20, 30, 26, 27, 30, 33, 40, 33, 36, 35, 34, 24, 33, 32, 32, 23, 15, 5, 87, 138, 158, 135, 150, 113, 120, 18, 1, 7, 132, 51, 89, 64, 80, 66, 127, 125, 117, 37, 97, 70, 51, 38, 75, 50, 46, 19, 27, 8, 133, 144, 97, 152, 130, 66, 146, 42, 103, 156, 119, 100, 42, 120, 122, 124, 138, 55, 11, 127, 155, 154, 142, 156, 111, 72, 140, 157, 161, 160,
+#> 145, 111, 70, 53, 83, 128, 109, 144, 41, 102, 117, 33, 113, 150, 144, 159, 151, 153, 140, 159, 112, 144, 158, 159, 156, 102, 143, 153, 143, 130, 147, 14, 130, 126, 6, 34, 37, 35, 35, 39, 35, 36, 25, 28, 35, 33, 34, 33, 35, 35, 35, 37, 34, 35, 22, 12, 35, 7, 27, 15, 27, 24, 26, 154, 149, 148, 19, 147, 91, 125, 117, 46, 37, 74, 68, 67, 63, 45, 16, 15, 1, 10, 54, 55, 65, 66, 58, 66, 74, 38, 57, 62, 61, 21, 41, 20, 51, 68, 61, 77, 67, 55, 25, 17, 7, 16, 127, 109, 144, 157, 104, 120, 40, 139, 146, 133,
+#> 68, 78, 111, 118, 30, 34, 82, 74, 159, 162, 155, 154, 109, 136, 107, 53, 98, 103, 14, 84, 52, 84, 159, 157, 146, 145, 112, 76, 105, 151, 135, 154, 96, 106, 60, 44, 54, 93, 129, 12, 114, 141, 122, 142, 130, 133, 135, 119, 117, 24, 12, 39, 21, 49, 19, 29, 31, 33, 36, 26, 14, 13, 31, 9, 42, 30, 34, 36, 35, 36, 26, 29, 39, 33, 33, 36, 37, 35, 37, 33, 35, 33, 32, 35, 14, 143, 158, 147, 161, 152, 153, 107, 130, 153, 112, 147, 159, 155, 157, 149, 67, 73, 38, 18, 16, 150, 157, 157, 157, 109, 135, 158, 54,
+#> 161, 161, 141, 142, 141, 49, 89, 102, 27, 81, 52, 69, 140, 139, 92, 70, 62, 119, 25, 51, 3, 37, 34, 33, 11, 8, 28, 35, 20, 19, 38, 24, 140, 141, 149, 158, 149, 143, 143, 109, 143, 132, 112, 123, 81, 21, 37, 35, 35, 24, 29, 24, 24, 39, 19, 19, 3, 50, 51, 54, 67, 25, 59, 12, 1, 151, 155, 153, 109, 136, 153, 156, 150, 150, 102, 137, 80, 156, 162, 142, 110, 114, 162, 162, 147, 162, 159, 161, 158, 160, 156, 39, 60, 158, 160, 153, 113, 145, 141, 146, 160, 135, 159, 20, 148, 153, 74, 34, 137, 155, 55, 16,
+#> 23, 66, 143, 162, 149, 157, 162, 162, 162, 158, 155, 111, 139, 157, 157, 85, 41, 21, 146, 75, 152, 154, 153, 157, 119, 122, 139, 121, 138, 34, 89, 59, 34, 102, 17, 29, 33, 34, 29, 32, 24, 13, 17, 27, 5, 20, 88, 123, 137, 99, 130, 153, 150, 145, 144, 91, 111, 108, 144, 135, 129, 136, 129, 82, 33, 93, 28, 111, 44, 134, 142, 157, 160, 158, 155, 106, 143, 142, 151, 158, 161, 143, 145, 124, 66, 35, 154, 153, 152, 150, 135, 136, 85, 15, 29, 20, 133, 137, 143, 138, 103, 131, 83, 153, 130, 127, 87, 142,
+#> 136, 143, 38, 44, 100, 12, 33, 38, 38, 36, 35, 21, 29, 35, 36, 26, 29, 36, 75, 62, 73, 33, 35, 32, 6, 8, 7, 149, 98, 16, 101, 87, 52, 14, 149, 158, 111, 143, 154, 162, 139, 153, 155, 121, 142, 114, 40, 13, 14, 65, 144, 150, 135, 42, 89, 145, 139, 155, 154, 142, 153, 132, 97, 145, 141, 24, 25, 142, 155, 140, 107, 90, 134, 133, 154, 144, 115, 140, 70, 82, 33, 1, 66, 149, 161, 151, 114, 144, 157, 154, 146, 85, 155, 98, 118, 24, 95, 125, 50, 146, 72, 68, 87, 63, 161, 135, 40, 90, 152, 141, 143, 135,
+#> 155, 154, 154, 39, 133, 114, 100, 2, 36, 49, 53, 58, 131, 143, 89, 145, 147, 69, 98, 5, 52, 84, 9, 33, 26, 23, 9, 16, 19, 30, 122, 108, 149, 156, 131, 85, 29, 92, 127, 29, 9, 4, 26, 33, 35, 34, 34, 25, 30, 30, 8, 14, 4, 4, 11, 49, 51, 59, 66, 36, 80, 71, 47, 52, 28, 24, 75, 23, 46, 70, 54, 56, 94, 125, 105, 138, 138, 85, 11, 52, 19, 31, 26, 55, 54, 6, 6, 5, 4, 12, 19, 19, 39, 20, 148, 148, 112, 118, 154, 122, 154, 120, 137, 133, 93, 46, 56, 84, 83, 110, 129, 52, 84, 143, 81, 142, 136, 158, 69, 136,
+#> 151, 153, 151, 144, 156, 155, 151, 64, 148, 152, 153, 145, 92, 62, 108, 58, 60, 149, 132, 138, 148, 144, 144, 128, 128, 35, 95, 63, 6, 40, 85, 8, 67, 109, 130, 97, 118, 37, 49, 104, 110, 48, 26, 98, 148, 159, 157, 110, 139, 158, 144, 142, 154, 146, 135, 111, 149, 145, 44, 5, 38, 73, 78, 159, 157, 159, 154, 110, 138, 151, 153, 155, 151, 149, 129, 32, 72, 6, 111, 139, 138, 158, 108, 135, 125, 154, 160, 162, 159, 159, 154, 152, 49, 78, 87, 4, 5, 35, 56, 42, 34, 13, 17, 28, 35, 35, 24, 13, 16, 35, 36,
+#> 24, 32, 32, 31, 24, 14, 45, 63, 73, 67, 65, 69, 42, 54, 48, 55, 56, 49, 23, 142, 100, 143, 156, 157, 136, 98, 158, 137, 138, 148, 60, 76, 21, 149, 107, 112, 148, 152, 5, 37, 109, 141, 136, 141, 135, 68, 129, 113, 126, 83, 108, 158, 161, 154, 103, 135, 100, 26, 133, 147, 22, 33, 73, 105, 79, 93, 15, 78, 94, 67, 103, 95, 68, 130, 82, 118, 121, 97, 28, 47, 98, 136, 58, 32, 62, 9, 123, 153, 159, 106, 143, 158, 161, 163, 161, 141, 83, 147, 132, 126, 56, 90, 149, 63, 85, 161, 84, 62, 40, 11, 21, 35, 34,
+#> 32, 34, 27, 8, 34, 23, 13, 17, 11, 29, 31, 31, 30, 25, 5, 25, 72, 100, 136, 114, 58, 74, 141, 81, 26, 155, 135, 97, 82, 58, 31, 65, 76, 48, 60, 63, 73, 81, 12, 31, 34, 68, 36, 26, 16, 101, 72, 89, 110, 109, 42, 112, 139, 157, 159, 148, 159, 96, 149, 71, 75, 45, 98, 8, 26, 41, 14, 2, 115, 136, 107, 93, 143, 150, 159, 126, 136, 132, 151, 155, 123, 98, 87, 15, 6, 27, 13, 26, 20, 32, 33, 18, 33, 21, 14, 17, 28, 3, 26, 31, 45, 138, 110, 131, 59, 140, 96, 54, 38, 89, 89, 6, 66, 130, 27, 29, 9, 28, 162,
+#> 115, 133, 157, 151, 93, 139, 119, 139, 116, 124, 25, 140, 131, 114, 28, 80, 21, 4, 7, 22, 33, 33, 31, 36, 23, 30, 14, 30, 11, 23, 35, 35, 35, 35, 18, 35, 34, 33, 10, 30, 22, 7, 129, 61, 143, 155, 157, 138, 161, 155, 101, 143, 103, 107, 117, 38, 1, 63, 30, 161, 153, 152, 135, 143, 111, 143, 146, 137, 131, 78, 59, 64, 54, 4, 97, 120, 124, 31, 102, 135, 84, 44, 128, 83, 108, 109, 19, 81, 142, 159, 162, 142, 94, 139, 161, 143, 159, 156, 152, 140, 150, 147, 104, 58, 112, 139, 43, 74, 113, 152, 111, 140,
+#> 161, 141, 154, 139, 161, 139, 27, 6, 7, 24, 13, 15, 34, 51, 62, 69, 66, 44, 32, 68, 66, 71, 74, 61, 70, 55, 79, 16, 40, 8, 8, 25, 28, 63, 72, 52, 64, 61, 49, 57, 66, 37, 52, 137, 145, 103, 119, 124, 62, 122, 131, 9, 28, 33, 33, 12, 17, 29, 32, 33, 34, 33, 18, 19, 3, 22, 91, 137, 152, 150, 150, 147, 118, 142, 120, 154, 152, 152, 130, 133, 100, 53, 104, 24, 66, 5, 58, 144, 84, 135, 131, 143, 153, 113, 10, 20, 114, 12, 9, 105, 52, 139, 160, 159, 162, 158, 85, 122, 24, 143, 147, 148, 142, 15, 72, 21,
+#> 48, 109, 134, 112, 141, 116, 139, 159, 151, 161, 151, 30, 125, 107, 33, 25, 153, 116, 67, 159, 105, 144, 124, 162, 159, 162, 156, 160, 150, 137, 126, 102, 114, 27, 40, 47, 98, 137, 151, 147, 123, 146, 158, 156, 147, 159, 143, 59, 143, 130, 149, 107, 17, 108, 22, 71, 28, 30, 18, 94, 141, 114, 133, 154, 55, 152, 150, 144, 137, 153, 142, 110, 117, 85, 26, 13, 73, 12, 32, 25, 24, 32, 36, 33, 29, 31, 34, 34, 33, 31, 27, 30, 32, 28, 34, 35, 23, 41, 22, 29, 13, 19, 10, 15, 30, 22, 33, 9, 116, 138, 107,
+#> 133, 81, 86, 135, 133, 103, 126, 140, 130, 135, 93, 88, 24, 85, 62, 139, 108, 144, 143, 129, 128, 158, 141, 146, 154, 119, 148, 141, 131, 40, 89, 151, 159, 152, 161, 137, 157, 154, 160, 161, 157, 156, 111, 39, 90, 34, 105, 3, 28, 34, 24, 30, 35, 35, 29, 34, 33, 9, 4, 28, 18, 7, 25, 60, 58, 51, 137, 152, 158, 101, 126, 150, 157, 72, 87, 112, 19, 9, 8, 80, 100, 138, 123, 133, 65, 134, 128, 109, 129, 150, 103, 76, 18, 31, 22, 6, 67, 70, 52, 60, 62, 61, 63, 62, 62, 9, 59, 55, 67, 56, 53, 50, 56, 66,
+#> 13, 48, 10, 55, 18, 15, 157, 159, 149, 158, 148, 150, 157, 119, 154, 159, 154, 156, 150, 153, 157, 131, 159, 17, 145, 41, 149, 106, 55, 92, 56, 81, 33, 95, 39, 93, 57, 24, 107, 34, 56, 17, 48, 146, 141, 161, 129, 148, 162, 162, 161, 155, 162, 154, 158, 138, 124, 137, 99, 122, 44, 151, 49, 144, 90, 120, 141, 118, 37, 117, 119, 153, 149, 138, 109, 26, 104, 56, 56, 4, 31, 35, 35, 33, 31, 32, 31, 22, 33, 15, 33, 38, 36, 33, 32, 21, 12, 30, 4, 14, 4, 1, 4, 3, 1, 34, 20, 28, 33, 27, 28, 32, 31, 29, 33,
+#> 30, 30, 17, 16, 28, 39, 47, 55, 70, 70, 66, 64, 70, 62, 61, 9, 55, 60, 65, 61, 48, 55, 50, 2, 66, 24, 30, 33, 31, 33, 31, 29, 18, 30, 29, 33, 31, 23, 5, 20, 9, 22, 84, 152, 156, 154, 159, 159, 160, 111, 143, 162, 158, 162, 158, 158, 160, 155, 154, 154, 110, 151, 120, 153, 154, 45, 149, 144, 34, 23, 1, 17, 35, 20, 11, 34, 35, 36, 33, 36, 35, 11, 26, 34, 8, 23, 24, 8, 35, 31, 18, 26, 12, 29, 2, 55, 46, 9, 50, 78, 78, 39, 34, 64, 60, 77, 24, 153, 143, 135, 140, 21, 156, 156, 38, 43, 62, 122, 121, 55,
+#> 65, 37, 156, 160, 112, 128, 151, 100, 55, 154, 142, 56, 142, 112, 115, 40, 88, 133, 65, 92, 24, 36, 136, 109, 97, 141, 155, 158, 142, 159, 155, 154, 150, 138, 138, 131, 51, 18, 142, 115, 129, 123, 161, 96, 115, 83, 151, 119, 104, 7, 56, 50, 24, 32, 6, 30, 34, 32, 20, 19, 16, 30, 35, 7, 19, 61, 66, 54, 66, 66, 71, 45, 64, 74, 71, 63, 67, 64, 66, 61, 64, 9, 64, 18, 41, 54, 43, 40, 41, 32, 16, 11, 18, 34, 32, 30, 34, 35, 16, 31, 31, 31, 30, 8, 5, 7, 22, 36, 38, 70, 96, 123, 114, 129, 152, 133, 135,
+#> 120, 33, 76, 108, 138, 142, 139, 157, 152, 127, 158, 155, 159, 148, 14, 74, 31, 153, 159, 162, 161, 161, 154, 156, 154, 160, 156, 154, 75, 82, 107, 77, 94, 3, 6, 23, 27, 35, 32, 39, 33, 11, 10, 3, 20, 27, 8, 4, 5, 49, 33, 46, 40, 48, 24, 32, 34, 42, 73, 21, 47, 19, 15, 66, 80, 79, 59, 44, 34, 3, 24, 155, 148, 158, 154, 136, 55, 15, 108, 23, 26, 25, 29, 33, 32, 22, 21, 4, 22, 65, 58, 23, 24, 55, 10, 47, 73, 88, 114, 28, 21, 151, 153, 151, 126, 154, 85, 36, 98, 102, 90, 76, 113, 16, 81, 152, 148, 93,
+#> 36, 154, 49, 94, 152, 150, 145, 57, 4, 26, 38, 120, 145, 141, 154, 95, 108, 102, 43, 120, 158, 153, 127, 136, 69, 22, 1, 4, 28, 27, 33, 35, 35, 26, 26, 34, 33, 36, 35, 33, 20, 17, 32, 22, 13, 21, 33, 29, 17, 24, 15, 24, 9, 20, 28, 3, 14, 121, 132, 135, 158, 153, 162, 161, 158, 160, 157, 158, 115, 34, 130, 128, 59, 149, 135, 133, 119, 37, 96, 24, 16, 50, 134, 86, 145, 108, 34, 130, 131, 131, 118, 67, 38, 6, 96, 151, 133, 145, 120, 147, 146, 137, 53, 59, 143, 69, 8, 140, 157, 157, 160, 157, 156, 159,
+#> 158, 153, 137, 109, 110, 134, 128, 143, 95, 126, 112, 7, 68, 73, 61, 104, 7, 5, 42, 107, 74, 16, 1, 37, 62, 58, 66, 28, 64, 70, 78, 46, 75, 70, 66, 45, 15, 2, 71, 14, 156, 98, 155, 162, 141, 90, 69, 151, 140, 144, 161, 81, 64, 98, 44, 151, 145, 109, 133, 62, 48, 2, 63, 24, 42, 28, 17, 31, 11, 16, 2, 43, 37, 138, 153, 142, 152, 162, 162, 143, 161, 128, 144, 144, 139, 159, 26, 101, 123, 151, 144, 158, 150, 124, 135, 142, 139, 109, 18, 12, 9, 90, 159, 160, 154, 159, 161, 112, 156, 141, 156, 150, 143,
+#> 100, 152, 145, 13, 44, 24, 29, 34, 32, 34, 35, 43, 36, 32, 36, 12, 13, 21, 10, 16, 39, 34, 15, 33, 8, 25, 23, 27, 23, 11, 30, 34, 32, 26, 33, 34, 33, 34, 32, 8, 25, 34, 33, 30, 19, 10, 3, 15, 39, 52, 33, 36, 33, 18, 14, 20, 14, 38, 32, 4, 7, 33, 63, 64, 71, 13, 19, 45, 61, 33, 39, 54, 25, 56, 28, 27, 33, 34, 28, 30, 26, 31, 34, 29, 23, 10, 17, 18, 5, 98, 75, 60, 158, 157, 97, 61, 131, 65, 137, 145, 146, 138, 154, 141, 57, 139, 133, 142, 157, 157, 150, 67, 125, 153, 40, 87, 140, 107, 73, 69, 63, 81,
+#> 35, 24, 31, 30, 31, 34, 12, 19, 34, 20, 34, 33, 35, 30, 34, 11, 30, 28, 80, 106, 123, 108, 57, 128, 121, 110, 141, 122, 134, 47, 17, 83, 162, 157, 162, 87, 49, 145, 120, 23, 103, 154, 87, 21, 33, 35, 152, 159, 160, 159, 156, 160, 154, 144, 145, 154, 83, 151, 118, 124, 69, 124, 54, 140, 142, 153, 158, 152, 154, 155, 156, 80, 139, 139, 83, 145, 19, 83, 87, 64, 60, 71, 26, 37, 65, 140, 107, 125, 39, 89, 155, 137, 138, 159, 159, 152, 130, 145, 149, 115, 136, 121, 27, 48, 68, 51, 68, 65, 65, 67, 45, 24,
+#> 79, 26, 33, 51, 27, 68, 62, 63, 45, 17, 58, 73, 68, 58, 66, 60, 79, 33, 19, 61, 63, 69, 61, 35, 131, 79, 154, 156, 143, 154, 159, 138, 36, 150, 97, 37, 50, 121, 9, 48, 154, 159, 161, 156, 91, 58, 149, 153, 115, 151, 14, 128, 1, 8, 60, 111, 112, 151, 138, 143, 142, 137, 142, 143, 144, 51, 111, 120, 115, 21, 145, 157, 153, 160, 153, 160, 52, 82, 155, 157, 146, 131, 84, 92, 106, 154, 133, 154, 150, 141, 152, 157, 149, 153, 149, 124, 138, 124, 72, 96, 8, 118, 3, 151, 143, 142, 49, 78, 87, 91, 72, 125,
+#> 20, 16, 115, 153, 151, 153, 156, 125, 160, 137, 90, 23, 8, 33, 58, 113, 80, 44, 28, 11, 116, 141, 146, 155, 150, 158, 147, 140, 76, 141, 151, 120, 149, 48, 33, 45, 1, 6, 135, 99, 148, 148, 154, 138, 98, 147, 160, 146, 119, 152, 156, 140, 144, 142, 139, 157, 157, 159, 161, 162, 161, 161, 162, 146, 162, 161, 67, 95, 150, 143, 153, 24, 79, 113, 140, 79, 159, 37, 123, 154, 150, 61, 29, 49, 101, 103, 75, 50, 130, 128, 127, 150, 128, 130, 143, 129, 134, 139, 117, 81, 36, 21, 16, 79, 104, 125, 162, 153,
+#> 162, 58, 103, 141, 153, 155, 161, 59, 101, 123, 91, 39, 3, 1, 51, 107, 37, 50, 67, 141, 112, 89, 140, 150, 105, 122, 110, 130, 102, 107, 3, 44, 18, 71, 71, 77, 76, 73, 62, 9, 45, 15, 64, 30, 41, 36, 19, 8, 161, 157, 157, 154, 161, 143, 158, 148, 160, 159, 147, 154, 99, 159, 157, 12, 137, 122, 154, 112, 77, 56, 146, 152, 154, 153, 162, 162, 148, 156, 105, 155, 153, 139, 136, 9, 105, 46, 122, 152, 141, 156, 133, 129, 51, 73, 114, 122, 99, 140, 60, 27, 34, 30, 26, 33, 32, 17, 3, 3, 15, 9, 44, 62, 75,
+#> 73, 78, 72, 68, 79, 68, 33, 156, 137, 144, 143, 144, 129, 139, 87, 115, 129, 135, 114, 86, 5, 101, 119, 32, 117, 26, 7, 15, 42, 44, 69, 62, 14, 35, 35, 35, 34, 35, 34, 34, 32, 34, 34, 13, 32, 30, 3, 2, 31, 130, 96, 122, 119, 97, 119, 117, 134, 145, 132, 61, 57, 15, 10, 5, 62, 75, 66, 66, 69, 31, 68, 20, 20, 13, 26, 105, 159, 160, 162, 162, 162, 162, 162, 162, 133, 158, 158, 97, 59, 91, 53, 56, 68, 69, 84, 55, 24, 23, 151, 124, 155, 147, 31, 78, 84, 133, 39, 54, 131, 117, 91, 52, 7, 32, 33, 37, 22,
+#> 32, 21, 6, 44, 9, 22, 158, 156, 156, 145, 156, 159, 135, 109, 117, 147, 137, 151, 93, 58, 67, 5, 106, 150, 154, 156, 157, 159, 161, 158, 159, 112, 142, 141, 108, 145, 135, 80, 8, 12, 63, 74, 74, 67, 32, 33, 33, 35, 35, 33, 34, 34, 34, 34, 21, 17, 9, 4, 23, 24, 26, 29, 33, 30, 27, 32, 21, 30, 21, 7, 8, 20, 2, 36, 19, 17, 34, 36, 21, 19, 32, 31, 34, 32, 33, 32, 25, 13, 5, 20, 33, 77, 77, 70, 14, 2, 20, 34, 50, 22, 141, 70, 158, 158, 162, 155, 161, 158, 50, 150, 155, 141, 39, 109, 85, 28, 41, 75, 44,
+#> 128, 136, 134, 146, 152, 150, 122, 142, 85, 50, 87, 142, 86, 49, 55, 105, 106, 162, 146, 124, 158, 153, 64, 4, 47, 86, 91, 38, 16, 11, 54, 67, 72, 72, 65, 72, 72, 43, 44, 31, 15, 20, 158, 134, 159, 132, 9, 84, 21, 14, 27, 42, 40, 35, 38, 8, 7, 6, 10, 16, 55, 128, 145, 116, 153, 70, 103, 8, 146, 110, 150, 32, 24, 3, 30, 159, 161, 134, 156, 154, 149, 108, 158, 157, 131, 77, 130, 67, 83, 140, 153, 124, 152, 144, 110, 87, 126, 147, 85, 8, 97, 140, 146, 160, 130, 158, 150, 153, 154, 113, 119, 73, 68,
+#> 68, 145, 102, 152, 141, 116, 22, 32, 28, 32, 33, 25, 15, 13, 20, 12, 24, 35, 36, 33, 5, 26, 6, 8, 15, 86, 10, 130, 89, 125, 128, 150, 159, 151, 149, 109, 150, 145, 146, 90, 137, 142, 146, 30, 15, 27, 45, 34, 33, 34, 33, 34, 25, 29, 21, 46, 135, 158, 159, 106, 22, 32, 65, 45, 135, 114, 150, 18, 57, 5, 63, 11, 151, 84, 96, 93, 145, 97, 9, 61, 27, 3, 120, 162, 159, 145, 49, 106, 151, 95, 123, 70, 68, 146, 145, 162, 162, 54, 78, 103, 54, 156, 158, 156, 123, 15, 123, 111, 66, 53, 79, 128, 149, 96, 140,
+#> 149, 155, 126, 135, 125, 113, 42, 12, 49, 141, 147, 153, 147, 73, 56, 99, 127, 145, 159, 151, 120, 19, 73, 132, 140, 153, 91, 102, 21, 86, 154, 154, 105, 155, 133, 101, 107, 77, 152, 138, 126, 159, 158, 156, 156, 156, 149, 143, 111, 154, 124, 156, 161, 148, 143, 89, 10, 16, 134, 105, 115, 120, 23, 15, 59, 151, 152, 154, 162, 157, 158, 159, 162, 58, 98, 158, 156, 152, 154, 142, 8, 92, 78, 108, 147, 150, 157, 158, 142, 135, 87, 75, 31, 61, 17, 62, 40, 6, 26, 49, 142, 143, 156, 151, 137, 155, 158, 152,
+#> 151, 122, 152, 149, 149, 144, 126, 81, 14, 104, 135, 109, 135, 100, 145, 72, 146, 140, 109, 137, 139, 81, 9, 13, 6, 32, 33, 33, 11, 14, 11, 29, 29, 32, 29, 32, 6, 5, 19, 20, 4, 78, 73, 69, 64, 68, 68, 70, 48, 66, 67, 62, 1, 19, 31, 32, 30, 34, 16, 17, 34, 34, 33, 10, 19, 7, 12, 29, 24, 30, 31, 33, 14, 33, 24, 34, 34, 13, 28, 33, 32, 1, 4, 28, 35, 34, 3, 54, 142, 135, 131, 157, 139, 107, 149, 126, 119, 51, 35, 1, 86, 144, 139, 51, 132, 142, 137, 133, 103, 131, 131, 109, 39, 68, 28, 35, 21, 36, 35,
+#> 35, 33, 32, 30, 20, 15, 24, 17, 9, 12, 69, 74, 68, 76, 6, 9, 67, 69, 48, 63, 64, 44, 62, 40, 58, 28, 33, 62, 19, 88, 159, 144, 162, 160, 143, 152, 71, 80, 153, 129, 4, 49, 127, 131, 150, 127, 85, 30, 28, 8, 126, 89, 132, 117, 70, 134, 133, 107, 57, 44, 30, 7, 87, 160, 158, 158, 157, 160, 160, 150, 161, 161, 148, 159, 119, 127, 152, 150, 140, 158, 153, 162, 102, 59, 162, 115, 160, 157, 155, 66, 81, 15, 40, 30, 21, 35, 44, 46, 40, 39, 38, 17, 3, 25, 7, 17, 21, 10, 49, 85, 59, 79, 148, 85, 71, 154,
+#> 43, 100, 85, 66, 4, 109, 16, 32, 75, 38, 112, 159, 143, 138, 156, 155, 159, 59, 39, 17, 77, 91, 47, 145, 146, 161, 145, 159, 155, 154, 145, 150, 148, 149, 141, 143, 143, 145, 150, 64, 2, 106, 156, 160, 160, 159, 162, 156, 155, 135, 157, 159, 156, 21, 126, 6, 36, 34, 125, 149, 147, 52, 91, 132, 124, 119, 21, 46, 45, 88, 118, 144, 53, 94, 122, 126, 86, 43, 110, 142, 141, 153, 132, 122, 90, 118, 153, 152, 120, 142, 158, 123, 117, 18, 76, 136, 116, 4, 4, 19, 1, 1, 54, 64, 26, 69, 71, 74, 16, 38, 49,
+#> 23, 29, 35, 33, 33, 34, 34, 1, 78, 153, 156, 51, 105, 123, 148, 133, 150, 121, 81, 137, 134, 116, 86, 30, 40, 74, 141, 157, 157, 163, 135, 81, 69, 134, 127, 25, 135, 49, 8, 8, 23, 13, 4, 32, 35, 34, 33, 11, 21, 31, 32, 32, 35, 33, 30, 15, 15, 8, 5, 59, 69, 66, 69, 64, 76, 70, 53, 31, 42, 78, 23, 25, 69, 60, 2, 30, 32, 33, 35, 33, 34, 33, 34, 32, 20, 2, 158, 154, 153, 151, 142, 92, 64, 93, 86, 128, 105, 132, 122, 160, 159, 161, 160, 159, 161, 160, 157, 156, 7, 17, 53, 151, 144, 132, 150, 47, 97, 90,
+#> 35, 131, 140, 109, 146, 138, 137, 82, 147, 113, 120, 158, 43, 94, 147, 160, 132, 159, 156, 115, 103, 83, 131, 155, 34, 73, 59, 130, 139, 145, 138, 143, 128, 121, 102, 140, 135, 121, 125, 155, 158, 139, 93, 63, 158, 124, 157, 141, 156, 73, 6, 32, 32, 31, 34, 37, 37, 38, 35, 42, 25, 35, 69, 53, 161, 153, 160, 159, 36, 133, 126, 160, 93, 143, 47, 69, 69, 160, 154, 160, 160, 144, 157, 102, 156, 112, 134, 38, 34, 114, 156, 158, 153, 160, 132, 152, 153, 159, 136, 85, 37, 145, 32, 73, 17, 59, 59, 67, 66,
+#> 65, 63, 70, 61, 66, 37, 22, 22, 75, 40, 131, 142, 79, 18, 148, 139, 135, 144, 153, 160, 85, 4, 18, 16, 110, 144, 127, 152, 142, 54, 155, 104, 126, 48, 136, 50, 33, 33, 31, 30, 31, 28, 34, 18, 17, 34, 34, 33, 28, 32, 8, 29, 17, 32, 27, 30, 32, 37, 29, 3, 13, 17, 19, 32, 10, 13, 20, 12, 19, 72, 44, 147, 145, 145, 136, 102, 120, 42, 80, 28, 43, 158, 162, 162, 157, 106, 33, 71, 52, 60, 39, 58, 121, 151, 155, 143, 97, 125, 133, 127, 111, 129, 70, 162, 162, 155, 82, 75, 124, 15, 153, 148, 59, 22, 10, 119,
+#> 63, 126, 93, 140, 157, 109, 161, 152, 144, 105, 108, 14, 158, 154, 156, 154, 158, 158, 162, 137, 155, 88, 142, 156, 160, 138, 144, 39, 157, 158, 159, 162, 161, 162, 162, 162, 42, 158, 4, 50, 84, 92, 150, 159, 147, 126, 108, 106, 122, 60, 74, 42, 74, 26, 30, 63, 26, 54, 34, 31, 59, 26, 38, 70, 62, 37, 25, 68, 30, 42, 72, 76, 81, 68, 50, 47, 3, 54, 64, 72, 68, 47, 29, 60, 60, 57, 40, 18, 54, 29, 61, 44, 65, 74, 52, 60, 75, 71, 20, 21, 31, 139, 157, 154, 75, 159, 141, 160, 135, 93, 113, 151, 158, 157,
+#> 150, 154, 61, 135, 140, 35, 36, 4, 41, 27, 34, 6, 6, 22, 20, 1, 8, 1, 73, 68, 22, 11, 32, 72, 69, 18, 10, 16, 30, 32, 33, 31, 18, 11, 13, 27, 26, 23, 30, 36, 32, 34, 33, 31, 33, 30, 20, 12, 2, 9, 33, 32, 33, 20, 31, 22, 12, 13, 15, 35, 33, 34, 13, 6, 78, 80, 70, 78, 66, 72, 67, 50, 25, 11, 24, 34, 33, 33, 33, 33, 32, 34, 16, 16, 43, 156, 161, 162, 160, 160, 159, 123, 36, 157, 159, 156, 11, 112, 6, 6, 149, 158, 141, 153, 155, 150, 147, 151, 121, 148, 51, 114, 129, 111, 124, 140, 136, 139, 138, 136,
+#> 110, 136, 41, 106, 137, 152, 84, 45, 85, 81, 55, 34, 146, 79, 36, 21, 153, 131, 146, 156, 147, 132, 53, 101, 122, 30, 33, 38, 72, 18, 73, 158, 142, 63, 96, 145, 123, 157, 132, 149, 82, 124, 149, 149, 92, 133, 81, 56, 15, 12, 33, 32, 32, 31, 33, 33, 21, 11, 32, 122, 157, 151, 133, 74, 160, 162, 160, 1, 11, 18, 141, 102, 105, 125, 52, 47, 54, 14, 10, 78, 39, 111, 113, 162, 157, 154, 68, 63, 151, 154, 110, 40, 157, 150, 52, 90, 156, 89, 133, 121, 148, 151, 89, 50, 57, 81, 130, 99, 131, 118, 86, 82,
+#> 50, 23, 39, 8, 15, 19, 120, 152, 139, 59, 77, 38, 101, 125, 38, 112, 63, 151, 152, 156, 151, 143, 109, 156, 154, 130, 31, 116, 105, 69, 105, 155, 160, 55, 158, 138, 33, 104, 156, 87, 133, 116, 10, 8, 24, 33, 3, 52, 32, 33, 33, 29, 13, 24, 29, 32, 32, 32, 41, 132, 119, 149, 151, 162, 160, 159, 137, 28, 32, 34, 35, 35, 33, 32, 30, 34, 33, 33, 31, 31, 33, 32, 32, 20, 157, 162, 106, 157, 142, 101, 145, 147, 61, 95, 17, 105, 138, 157, 141, 53, 105, 155, 130, 106, 46, 95, 52, 98, 155, 159, 162, 161, 106,
+#> 73, 150, 154, 3, 61, 37, 25, 40, 37, 33, 35, 32, 7, 130, 109, 144, 149, 144, 77, 51, 27, 17, 42, 22, 81, 74, 68, 67, 64, 73, 69, 13, 68, 47, 42, 19, 30, 10, 128, 91, 65, 39, 70, 125, 148, 18, 89, 88, 151, 150, 125, 93, 143, 96, 149, 126, 153, 141, 160, 139, 135, 149, 142, 130, 142, 6, 38, 41, 32, 32, 32, 20, 46, 69, 74, 62, 59, 21, 163, 162, 162, 51, 143, 93, 142, 145, 141, 34, 6, 28, 14, 29, 31, 26, 12, 22, 26, 29, 31, 24, 33, 36, 34, 34, 27, 29, 35, 34, 23, 7, 35, 33, 29, 21, 31, 24, 12, 31, 30,
+#> 31, 34, 34, 33, 33, 31, 34, 31, 7, 43, 100, 134, 153, 152, 92, 40, 41, 59, 85, 89, 145, 127, 135, 110, 70, 153, 21, 24, 9, 6, 32, 35, 35, 34, 40, 36, 34, 36, 32, 32, 15, 25, 155, 101, 151, 122, 143, 47, 126, 91, 87, 41, 16, 13, 23, 12, 11, 117, 142, 107, 21, 113, 161, 149, 92, 118, 155, 153, 24, 151, 131, 150, 161, 111, 162, 62, 158, 6, 14, 2, 91, 8, 66, 145, 151, 120, 33, 121, 130, 94, 83, 9, 14, 24, 27, 32, 35, 37, 49, 52, 45, 45, 35, 32, 33, 23, 31, 30, 21, 32, 33, 11, 40, 6, 7, 53, 71, 14, 77,
+#> 64, 42, 69, 68, 64, 6, 20, 70, 64, 8, 6, 30, 30, 18, 7, 108, 45, 148, 148, 147, 150, 136, 148, 156, 158, 158, 158, 158, 154, 154, 159, 146, 158, 159, 161, 154, 136, 48, 4, 67, 20, 4, 31, 33, 33, 33, 33, 33, 33, 8, 41, 96, 31, 128, 108, 124, 159, 109, 159, 152, 17, 70, 97, 144, 138, 134, 121, 33, 145, 153, 18, 158, 74, 134, 149, 111, 22, 31, 32, 33, 34, 35, 27, 34, 96, 130, 139, 144, 148, 26, 75, 151, 134, 49, 74, 151, 161, 156, 156, 104, 147, 161, 157, 161, 160, 160, 104, 160, 155, 156, 34, 79, 98,
+#> 137, 138, 143, 141, 138, 156, 156, 120, 133, 141, 133, 156, 104, 46, 55, 100, 92, 124, 159, 158, 159, 161, 162, 151, 151, 7, 50, 74, 75, 62, 13, 49, 13, 60, 10, 29, 31, 32, 13, 29, 21, 79, 63, 68, 63, 61, 29, 104, 141, 116, 102, 124, 67, 9, 47, 159, 158, 141, 160, 136, 156, 160, 61, 155, 157, 45, 114, 131, 97, 151, 143, 136, 97, 49, 143, 43, 108, 138, 133, 159, 150, 149, 154, 150, 6, 11, 3, 33, 9, 3, 64, 30, 162, 152, 108, 153, 40, 84, 151, 80, 23, 83, 52, 6, 130, 150, 129, 154, 147, 155, 113, 88,
+#> 139, 158, 41, 153, 152, 117, 108, 141, 157, 126, 4, 38, 25, 9, 1, 32, 35, 27, 33, 34, 34, 35, 33, 20, 27, 39, 63, 48, 38, 73, 72, 39, 76, 68, 69, 14, 54, 5, 23, 32, 34, 31, 27, 11, 23, 21, 11, 27, 29, 87, 156, 114, 109, 149, 124, 35, 151, 146, 115, 101, 129, 158, 159, 141, 114, 110, 141, 149, 152, 136, 57, 6, 87, 151, 43, 154, 152, 140, 127, 30, 143, 156, 141, 72, 22, 2, 15, 8, 91, 156, 161, 113, 161, 141, 58, 77, 156, 108, 154, 158, 157, 157, 146, 157, 142, 128, 158, 104, 149, 154, 27, 48, 137,
+#> 118, 117, 104, 145, 144, 150, 113, 95, 61, 127, 5, 40, 139, 157, 157, 159, 139, 118, 100, 153, 7, 9, 33, 114, 130, 137, 131, 128, 140, 136, 134, 138, 128, 129, 135, 134, 72, 30, 113, 12, 16, 142, 144, 102, 133, 114, 136, 145, 111, 24, 68, 9, 26, 108, 101, 148, 157, 155, 160, 137, 157, 12, 5, 28, 30, 34, 23, 21, 154, 154, 130, 158, 154, 156, 12, 43, 43, 22, 37, 73, 64, 43, 17, 31, 31, 33, 32, 32, 33, 34, 128, 152, 159, 131, 158, 51, 156, 82, 162, 39, 76, 138, 150, 142, 48, 145, 160, 109, 159, 133,
+#> 111, 157, 58, 153, 137, 97, 94, 137, 147, 148, 41, 74, 49, 157, 146, 147, 15, 19, 30, 88, 87, 60, 28, 8, 11, 80, 113, 45, 31, 28, 139, 160, 127, 160, 7, 114, 157, 158, 154, 95, 74, 149, 152, 122, 150, 8, 41, 35, 115, 126, 150, 144, 71, 153, 157, 139, 101, 130, 49, 117, 43, 6, 61, 115, 133, 140, 49, 87, 160, 140, 160, 7, 31, 31, 30, 18, 14, 4, 4, 20, 30, 34, 9, 116, 157, 155, 22, 92, 160, 60, 49, 3, 12, 26, 36, 32, 53, 155, 160, 159, 161, 17, 33, 30, 33, 37, 81, 109, 149, 150, 121, 116, 143, 62, 144,
+#> 126, 100, 150, 123, 116, 145, 74, 4, 20, 35, 32, 31, 34, 36, 145, 154, 23, 31, 57, 147, 152, 158, 154, 43, 88, 135, 95, 28, 72, 114, 149, 151, 156, 137, 17, 110, 159, 129, 133, 137, 151, 98, 153, 80, 9, 38, 145, 158, 155, 158, 162, 148, 10, 27, 29, 18, 22, 24, 5, 9, 26, 33, 1, 108, 151, 129, 135, 51, 101, 102, 57, 21, 58, 127, 159, 56, 87, 38, 148, 145, 31, 137, 75, 157, 47, 135, 135, 153, 66, 143, 149, 153, 143, 14, 75, 158, 158, 158, 49, 155, 109, 156, 161, 143, 130, 99, 151, 57, 43, 27, 152, 51,
+#> 134, 156, 39, 59, 158, 53, 113, 86, 123, 158, 18, 144, 156) x c(245, 289, 182, 259, 236, 257, 282, 10, 30, 162, 23, 49, 181, 271, 308, 305, 261, 257, 409, 374, 361, 379, 442, 490, 411, 487, 478, 513, 486, 273, 121, 206, 340, 332, 316, 297, 343, 370, 211, 327, 340, 21, 270, 326, 381, 361, 249, 253, 175, 79, 122, 154, 96, 76, 297, 206, 579, 517, 529, 534, 577, 521, 419, 43, 152, 189, 259, 210, 166, 205, 191, 181, 149, 92, 21, 29, 117, 79, 11, 84, 283, 210, 215, 205, 262, 173, 187, 57, 101, 131, 55, 103, 284, 220, 256, 212, 186, 179, 144, 138, 8, 298, 584, 596,
+#> 536, 612, 560, 539, 531, 527, 550, 568, 588, 181, 285, 46, 40, 1, 65, 174, 196, 187, 186, 140, 180, 153, 154, 148, 124, 153, 148, 137, 148, 120, 104, 125, 115, 107, 55, 25, 16, 175, 545, 608, 312, 451, 544, 348, 4, 485, 553, 249, 602, 509, 581, 469, 591, 315, 448, 465, 419, 490, 426, 6, 34, 81, 98, 3, 112, 115, 139, 116, 86, 101, 91, 75, 9, 11, 130, 127, 124, 133, 127, 91, 107, 129, 95, 107, 112, 110, 103, 105, 51, 5, 17, 465, 597, 498, 405, 474, 524, 527, 522, 384, 146, 291, 206, 567, 542, 602,
+#> 259, 408, 38, 560, 534, 288, 165, 561, 570, 547, 69, 359, 5, 138, 287, 258, 288, 268, 266, 317, 299, 313, 17, 226, 237, 212, 69, 2, 74, 238, 367, 263, 111, 371, 323, 387, 329, 430, 265, 142, 256, 91, 0, 0, 127, 389, 515, 555, 550, 562, 575, 563, 582, 591, 589, 588, 574, 581, 609, 582, 612, 322, 104, 2, 635, 581, 596, 588, 310, 562, 41, 58, 99, 154, 157, 84, 138, 158, 136, 32, 16, 11, 0, 4, 103, 114, 76, 97, 100, 114, 97, 80, 36, 103, 13, 13, 135, 161, 124, 140, 130, 91, 109, 82, 45, 69, 60, 13, 12,
+#> 0, 2, 150, 358, 605, 581, 573, 506, 591, 553, 428, 345, 563, 542, 588, 421, 497, 428, 507, 526, 556, 625, 415, 233, 490, 353, 13, 98, 149, 516, 593, 577, 485, 550, 494, 511, 541, 587, 476, 538, 487, 403, 508, 410, 323, 147, 73, 13, 18, 10, 98, 474, 525, 498, 491, 534, 491, 493, 260, 436, 210, 16, 2, 295, 235, 178, 406, 402, 331, 405, 328, 449, 234, 234, 227, 108, 162, 248, 221, 51, 256, 431, 491, 452, 380, 343, 334, 424, 297, 241, 80, 252, 209, 266, 276, 476, 143, 496, 236, 132, 606, 121, 593, 222,
+#> 12, 244, 31, 310, 550, 517, 518, 599, 602, 399, 527, 459, 427, 278, 525, 417, 501, 551, 550, 429, 392, 13, 2, 2, 77, 89, 93, 98, 85, 121, 125, 103, 91, 31, 54, 19, 59, 82, 16, 97, 117, 101, 110, 104, 102, 87, 34, 42, 11, 237, 588, 571, 527, 549, 534, 512, 490, 548, 516, 515, 568, 495, 556, 473, 558, 413, 552, 566, 432, 230, 86, 173, 348, 566, 488, 603, 437, 451, 489, 447, 533, 549, 544, 554, 583, 375, 369, 90, 464, 532, 340, 533, 508, 416, 463, 433, 155, 478, 446, 491, 278, 241, 83, 183, 3, 0, 117,
+#> 134, 88, 107, 150, 128, 148, 131, 115, 103, 103, 103, 66, 110, 83, 63, 99, 86, 56, 67, 55, 29, 12, 74, 92, 33, 3, 84, 493, 563, 342, 386, 538, 559, 577, 553, 497, 465, 550, 230, 177, 149, 103, 267, 15, 23, 330, 571, 581, 493, 543, 534, 526, 521, 545, 564, 330, 518, 602, 526, 598, 505, 556, 425, 375, 226, 33, 7, 2, 109, 149, 280, 342, 232, 266, 256, 178, 95, 63, 33, 12, 2, 91, 394, 407, 257, 216, 88, 1, 19, 116, 544, 538, 500, 580, 520, 571, 547, 546, 523, 471, 494, 552, 506, 426, 574, 486, 429, 539,
+#> 523, 191, 99, 120, 134, 129, 126, 73, 123, 89, 96, 86, 94, 90, 76, 60, 93, 81, 38, 36, 79, 101, 137, 128, 144, 134, 136, 147, 142, 130, 150, 125, 64, 111, 108, 93, 113, 97, 103, 46, 120, 126, 155, 135, 142, 157, 125, 126, 129, 98, 90, 20, 21, 77, 10, 7, 55, 69, 88, 124, 56, 43, 54, 6, 422, 192, 137, 194, 505, 68, 532, 496, 561, 511, 597, 596, 561, 550, 581, 500, 509, 506, 402, 84, 134, 22, 135, 259, 382, 486, 510, 482, 311, 300, 118, 274, 351, 84, 82, 2, 1, 7, 39, 83, 103, 53, 114, 97, 85, 22, 9,
+#> 92, 89, 63, 56, 55, 11, 31, 9, 147, 192, 149, 241, 240, 441, 451, 392, 474, 382, 452, 324, 295, 88, 5, 24, 0, 10, 406, 160, 374, 514, 507, 579, 499, 476, 547, 583, 587, 529, 386, 265, 97, 456, 577, 335, 72, 16, 3, 60, 72, 87, 88, 84, 98, 16, 59, 87, 7, 2, 26, 287, 195, 470, 411, 527, 477, 512, 125, 53, 83, 515, 346, 16, 27, 115, 208, 101, 256, 180, 297, 139, 53, 3, 0, 82, 176, 215, 229, 351, 351, 258, 137, 42, 67, 48, 220, 83, 132, 141, 110, 3, 11, 75, 61, 44, 113, 2, 120, 79, 92, 99, 100, 50, 93,
+#> 93, 79, 60, 78, 62, 60, 43, 39, 0, 20, 42, 261, 313, 387, 385, 368, 248, 309, 205, 2, 22, 26, 58, 364, 603, 563, 503, 508, 522, 519, 445, 464, 470, 544, 571, 419, 246, 137, 400, 163, 4, 91, 79, 5, 15, 42, 13, 31, 541, 561, 592, 577, 564, 570, 360, 553, 504, 567, 330, 234, 1, 252, 275, 503, 394, 241, 400, 300, 291, 297, 186, 120, 238, 5, 85, 97, 99, 19, 34, 20, 18, 71, 14, 23, 17, 75, 571, 572, 528, 453, 158, 303, 592, 538, 65, 516, 570, 333, 188, 355, 380, 351, 313, 435, 468, 331, 247, 184, 129,
+#> 118, 31, 124, 17, 220, 365, 391, 371, 378, 381, 289, 239, 132, 68, 138, 102, 103, 137, 130, 138, 139, 10, 70, 118, 95, 85, 111, 65, 79, 15, 50, 94, 86, 41, 4, 552, 573, 559, 508, 474, 544, 478, 468, 396, 537, 553, 516, 610, 500, 405, 227, 377, 570, 575, 526, 558, 482, 539, 591, 38, 441, 476, 257, 381, 471, 13, 46, 268, 537, 570, 425, 314, 541, 257, 573, 505, 386, 76, 52, 1, 54, 27, 104, 96, 105, 84, 8, 55, 63, 75, 76, 23, 59, 95, 63, 86, 11, 22, 46, 73, 468, 568, 543, 576, 456, 512, 567, 423, 440,
+#> 559, 584, 537, 607, 581, 155, 127, 0, 10, 37, 413, 492, 517, 473, 553, 430, 493, 501, 463, 524, 597, 586, 470, 79, 50, 104, 149, 186, 229, 151, 120, 100, 350, 292, 364, 186, 98, 62, 379, 10, 263, 5, 56, 32, 385, 526, 430, 491, 261, 504, 365, 267, 8, 8, 9, 113, 183, 335, 535, 557, 447, 564, 520, 398, 151, 585, 463, 444, 50, 395, 322, 506, 560, 540, 454, 451, 328, 555, 546, 461, 270, 487, 92, 529, 569, 536, 544, 583, 580, 580, 348, 355, 82, 95, 117, 103, 94, 61, 22, 207, 307, 359, 338, 316, 225, 330,
+#> 387, 424, 408, 272, 356, 167, 285, 264, 245, 249, 92, 76, 21, 32, 106, 86, 17, 27, 52, 82, 40, 84, 125, 15, 57, 27, 135, 409, 487, 442, 483, 455, 467, 248, 194, 330, 388, 108, 70, 492, 506, 503, 132, 277, 50, 6, 436, 525, 499, 522, 448, 503, 426, 214, 45, 102, 606, 534, 453, 535, 533, 528, 568, 362, 409, 536, 583, 568, 600, 349, 566, 616, 411, 247, 63, 401, 392, 413, 410, 424, 333, 394, 485, 416, 442, 382, 153, 343, 226, 26, 1, 2, 83, 68, 53, 85, 104, 43, 71, 57, 82, 19, 50, 86, 571, 586, 509, 604,
+#> 561, 38, 480, 493, 612, 672, 581, 594, 266, 234, 29, 366, 560, 558, 562, 571, 478, 67, 57, 310, 307, 237, 339, 347, 399, 323, 245, 364, 295, 260, 171, 192, 146, 10, 1, 17, 51, 605, 561, 622, 623, 597, 465, 534, 631, 605, 631, 614, 336, 349, 47, 129, 21, 2, 187, 548, 530, 158, 404, 284, 85, 74, 71, 12, 97, 86, 95, 52, 42, 48, 397, 2, 455, 587, 553, 599, 493, 448, 550, 357, 426, 465, 559, 65, 35, 35, 18, 21, 326, 473, 406, 313, 112, 92, 154, 264, 309, 318, 402, 354, 325, 148, 194, 563, 477, 478, 499,
+#> 335, 442, 171, 606, 651, 444, 319, 479, 453, 375, 515, 358, 17, 259, 451, 519, 537, 497, 498, 21, 166, 62, 156, 94, 518, 405, 468, 351, 435, 590, 562, 584, 535, 558, 314, 336, 492, 238, 65, 17, 1, 20, 92, 110, 31, 2, 63, 60, 11, 17, 2, 13, 274, 580, 539, 452, 511, 631, 582, 586, 636, 649, 613, 614, 491, 49, 629, 431, 10, 92, 136, 123, 317, 432, 457, 540, 406, 522, 529, 359, 495, 540, 536, 499, 518, 534, 457, 459, 365, 72, 160, 130, 380, 294, 247, 482, 290, 498, 579, 281, 280, 417, 473, 275, 193,
+#> 305, 57, 495, 523, 416, 512, 589, 592, 623, 424, 536, 504, 527, 568, 486, 602, 104, 357, 58, 9, 83, 23, 24, 5, 56, 14, 97, 4, 96, 5, 366, 316, 349, 154, 219, 214, 164, 221, 48, 122, 191, 114, 16, 25, 2, 256, 544, 587, 532, 96, 0, 500, 36, 230, 47, 523, 533, 541, 563, 582, 447, 420, 571, 629, 427, 546, 575, 206, 502, 556, 7, 72, 51, 85, 71, 13, 53, 91, 86, 67, 57, 112, 86, 99, 112, 109, 508, 375, 570, 346, 563, 446, 433, 435, 29, 193, 16, 268, 360, 299, 320, 286, 409, 331, 315, 191, 133, 10, 166,
+#> 551, 272, 69, 522, 435, 504, 579, 418, 165, 527, 483, 540, 563, 570, 163, 450, 376, 6, 427, 587, 620, 593, 564, 599, 588, 468, 244, 485, 521, 629, 610, 599, 542, 100, 324, 538, 296, 23, 13, 26, 92, 60, 79, 103, 95, 101, 113, 122, 108, 107, 104, 82, 18, 4, 27, 215, 234, 269, 386, 378, 370, 359, 398, 489, 335, 392, 330, 307, 91, 191, 24, 255, 584, 524, 590, 586, 530, 566, 575, 559, 474, 491, 536, 419, 602, 576, 476, 442, 1, 75, 49, 21, 30, 21, 97, 86, 104, 100, 96, 98, 102, 41, 509, 430, 301, 558,
+#> 592, 260, 286, 357, 592, 583, 566, 581, 487, 463, 512, 488, 350, 499, 143, 17, 69, 90, 69, 111, 114, 93, 126, 124, 96, 81, 96, 131, 91, 16, 57, 76, 44, 20, 5, 2, 7, 0, 45, 236, 0, 340, 570, 540, 552, 543, 446, 453, 534, 577, 520, 568, 523, 422, 147, 217, 17, 365, 227, 509, 564, 481, 492, 639, 587, 581, 603, 561, 615, 8, 22, 43, 227, 605, 412, 471, 407, 512, 582, 549, 618, 330, 124, 6, 1, 1, 17, 48, 101, 18, 120, 108, 92, 77, 68, 11, 90, 81, 59, 23, 8, 197, 586, 23, 557, 624, 561, 633, 595, 646, 649,
+#> 641, 603, 616, 616, 593, 413, 288, 85, 335, 5, 90, 108, 99, 89, 131, 76, 42, 20, 7, 75, 97, 110, 94, 111, 116, 99, 79, 82, 81, 82, 6, 19, 21, 45, 34, 58, 80, 104, 115, 80, 67, 64, 76, 54, 0, 539, 359, 366, 528, 443, 507, 569, 576, 557, 533, 548, 60, 103, 143, 6, 184, 183, 323, 267, 310, 393, 152, 335, 177, 87, 26, 474, 489, 581, 504, 559, 596, 526, 500, 372, 55, 84, 63, 69, 24, 54, 104, 108, 125, 69, 54, 77, 60, 37, 70, 78, 49, 53, 18, 18, 38, 77, 107, 104, 53, 45, 109, 143, 92, 27, 83, 16, 98, 32,
+#> 27, 34, 190, 440, 618, 514, 641, 603, 502, 545, 617, 547, 527, 540, 518, 486, 585, 550, 354, 303, 32, 38, 76, 7, 23, 107, 590, 587, 592, 560, 571, 586, 499, 222, 402, 577, 166, 188, 202, 164, 469, 310, 478, 550, 632, 614, 499, 282, 126, 68, 28, 40, 70, 95, 63, 35, 97, 89, 98, 63, 57, 51, 5, 1, 7, 13, 58, 45, 134, 411, 387, 491, 461, 341, 252, 644, 610, 404, 434, 387, 312, 125, 17, 4, 70, 74, 49, 100, 80, 98, 5, 102, 120, 95, 113, 124, 102, 49, 30, 4, 5, 15, 51, 94, 94, 101, 95, 81, 61, 51, 47, 39,
+#> 38, 54, 20, 53, 47, 26, 55, 97, 94, 47, 101, 101, 109, 107, 84, 103, 84, 81, 104, 65, 55, 40, 34, 35, 44, 24, 3, 92, 104, 97, 125, 117, 62, 108, 21, 92, 80, 31, 479, 545, 587, 349, 523, 610, 588, 577, 569, 589, 178, 574, 443, 272, 20, 18, 218, 305, 492, 538, 505, 500, 392, 140, 148, 137, 29, 76, 38, 47, 1, 182, 451, 556, 286, 537, 543, 602, 455, 524, 570, 573, 502, 505, 558, 453, 459, 31, 43, 32, 94, 109, 144, 107, 101, 132, 79, 98, 108, 117, 90, 55, 0, 5, 20, 5, 21, 12, 14, 69, 91, 105, 74, 102,
+#> 112, 126, 88, 34, 46, 68, 46, 19, 3, 70, 572, 558, 553, 594, 608, 578, 569, 588, 578, 353, 484, 503, 524, 22, 141, 44, 533, 562, 593, 563, 542, 519, 524, 543, 547, 463, 429, 531, 570, 384, 267, 8, 132, 3, 0, 8, 113, 125, 270, 260, 392, 452, 183, 22, 317, 492, 178, 133, 52, 248, 249, 174, 67, 163, 67, 123, 10, 2, 2, 28, 32, 64, 111, 86, 104, 73, 102, 78, 83, 67, 54, 75, 30, 25, 19, 7, 1, 3, 42, 101, 115, 77, 73, 39, 13, 43, 5, 3, 1, 0, 89, 83, 106, 98, 55, 90, 96, 74, 89, 67, 56, 28, 4, 15, 17, 41,
+#> 336, 393, 502, 521, 493, 622, 591, 405, 516, 376, 453, 522, 542, 543, 442, 74, 291, 108, 112, 15, 2, 77, 388, 372, 383, 379, 344, 174, 200, 68, 145, 345, 35, 416, 17, 370, 536, 567, 644, 594, 557, 555, 489, 433, 364, 366, 43, 16, 79, 0, 122, 84, 61, 92, 50, 60, 56, 44, 15, 9, 56, 6, 18, 8, 24, 75, 77, 85, 65, 83, 101, 99, 85, 69, 74, 51, 60, 66, 53, 21, 14, 8, 327, 596, 411, 385, 469, 537, 551, 431, 555, 195, 122, 523, 511, 465, 52, 19, 571, 616, 545, 591, 574, 573, 569, 540, 497, 615, 513, 624,
+#> 444, 204, 12, 72, 231, 354, 398, 284, 449, 388, 22, 508, 380, 406, 490, 438, 413, 424, 356, 299, 306, 64, 150, 61, 379, 402, 522, 487, 503, 518, 220, 476, 570, 507, 501, 285, 320, 319, 127, 184, 59, 14, 17, 6, 233, 261, 358, 361, 449, 501, 393, 368, 428, 350, 188, 198, 83, 50, 136, 63, 57, 420, 370, 432, 468, 514, 487, 459, 518, 429, 437, 411, 126, 98, 594, 654, 583, 406, 464, 581, 554, 513, 670, 605, 558, 525, 568, 419, 470, 330, 21, 81, 24, 133, 6, 50, 358, 600, 579, 601, 568, 581, 456, 553, 396,
+#> 188, 591, 572, 549, 614, 590, 572, 181, 57, 5, 77, 97, 104, 110, 91, 91, 122, 33, 73, 91, 97, 82, 70, 57, 72, 61, 75, 74, 67, 14, 3, 0, 40, 466, 617, 614, 285, 499, 509, 642, 613, 446, 262, 559, 157, 223, 567, 406, 253, 616, 614, 458, 570, 407, 25, 532, 268, 446, 192, 25, 151, 523, 528, 619, 603, 574, 576, 560, 487, 382, 311, 549, 556, 399, 544, 109, 36, 262, 229, 234, 191, 34, 59, 111, 329, 292, 189, 85, 58, 145, 10, 38, 88, 96, 73, 109, 106, 64, 48, 60, 10, 33, 2, 2, 3, 478, 392, 479, 407, 505,
+#> 470, 56, 60, 244, 558, 551, 462, 488, 603, 549, 209, 4, 9, 49, 544, 528, 509, 480, 540, 552, 523, 331, 59, 410, 524, 447, 386, 18, 308, 422, 278, 498, 593, 638, 574, 198, 356, 616, 625, 658, 556, 479, 313, 466, 51, 13, 12, 33, 326, 458, 546, 385, 605, 600, 16, 503, 35, 65, 81, 80, 88, 102, 110, 115, 107, 105, 37, 89, 80, 91, 54, 67, 53, 45, 86, 71, 83, 83, 78, 86, 102, 75, 19, 4, 10, 383, 180, 529, 551, 520, 574, 585, 395, 481, 360, 172, 20, 49, 5, 43, 85, 34, 56, 5, 76, 93, 96, 67, 25, 19, 39, 20,
+#> 2, 50, 97, 91, 81, 67, 13, 12, 26, 12, 437, 572, 584, 562, 553, 581, 619, 596, 593, 579, 535, 579, 569, 576, 28, 589, 570, 404, 545, 571, 484, 510, 523, 438, 477, 537, 446, 120, 39, 44, 1, 38, 43, 99, 92, 84, 75, 79, 76, 99, 109, 76, 46, 16, 30, 43, 6, 31, 32, 56, 54, 39, 48, 12, 3, 86, 95, 96, 98, 56, 87, 13, 42, 42, 38, 3, 0, 58, 4, 4, 13, 91, 122, 73, 96, 80, 90, 76, 85, 40, 69, 15, 67, 48, 57, 31, 33, 1, 108, 94, 72, 99, 74, 74, 61, 114, 87, 69, 65, 45, 27, 30, 19, 33, 30, 22, 536, 623, 602,
+#> 596, 589, 559, 630, 618, 599, 549, 585, 619, 625, 461, 238, 35, 294, 333, 225, 136, 7, 0, 7, 163, 489, 225, 580, 568, 607, 633, 611, 643, 475, 602, 596, 229, 252, 280, 335, 279, 443, 70, 411, 394, 362, 383, 274, 369, 277, 290, 230, 87, 2, 3, 37, 629, 659, 662, 260, 681, 565, 500, 611, 537, 414, 537, 619, 379, 166, 51, 164, 4, 287, 14, 14, 19, 38, 23, 22, 80, 96, 25, 76, 88, 122, 102, 30, 32, 93, 20, 4, 91, 69, 19, 38, 31, 33, 58, 78, 18, 50, 112, 86, 62, 10, 66, 54, 53, 7, 20, 91, 358, 225, 346,
+#> 520, 517, 446, 450, 253, 568, 535, 59, 257, 62, 48, 63, 44, 88, 83, 75, 73, 90, 72, 84, 70, 42, 19, 46, 0, 1, 79, 356, 543, 562, 646, 549, 609, 303, 595, 538, 383, 342, 106, 297, 291, 237, 57, 467, 428, 263, 566, 129, 465, 108, 37, 59, 13, 18, 459, 508, 603, 634, 610, 383, 618, 628, 601, 610, 641, 564, 568, 406, 515, 436, 45, 186, 49, 546, 613, 501, 416, 410, 465, 429, 417, 242, 401, 435, 355, 558, 554, 456, 403, 435, 85, 89, 1, 35, 593, 606, 648, 626, 586, 532, 563, 591, 417, 251, 298, 57, 87, 114,
+#> 114, 91, 44, 79, 60, 7, 33, 18, 57, 67, 51, 42, 101, 103, 54, 79, 62, 32, 0, 4, 93, 118, 116, 128, 140, 78, 150, 135, 33, 106, 12, 49, 8, 2, 4, 23, 560, 557, 614, 605, 515, 52, 467, 14, 171, 252, 391, 566, 157, 43, 99, 1, 95, 105, 105, 79, 78, 63, 64, 15, 51, 33, 2, 33, 20, 76, 150, 73, 140, 113, 153, 150, 122, 105, 66, 108, 82, 46, 47, 93, 86, 83, 108, 109, 117, 109, 110, 97, 58, 53, 81, 57, 60, 20, 16, 12, 9, 35, 354, 638, 528, 512, 595, 159, 229, 177, 9, 32, 130, 400, 517, 562, 515, 585, 573,
+#> 539, 535, 585, 569, 565, 467, 515, 487, 100, 205, 20, 224, 597, 534, 627, 631, 599, 598, 563, 614, 609, 482, 55, 309, 118, 17, 83, 22, 227, 494, 587, 611, 557, 602, 504, 556, 295, 570, 530, 520, 548, 518, 79, 77, 191, 8, 3, 16, 26, 81, 81, 56, 80, 55, 56, 47, 9, 21, 26, 385, 356, 132, 494, 574, 617, 612, 496, 552, 400, 62, 327, 56, 1, 41, 2, 64, 46, 87, 86, 103, 73, 105, 94, 68, 32, 37, 32, 34, 70, 64, 50, 82, 92, 97, 96, 62, 84, 59, 37, 72, 73, 76, 5, 92, 93, 90, 80, 119, 110, 108, 84, 68, 58, 57,
+#> 75, 29, 86, 87, 94, 82, 83, 92, 86, 95, 95, 31, 47, 30, 10, 70, 47, 47, 28, 2, 14, 253, 616, 648, 594, 650, 606, 435, 434, 109, 492, 406, 458, 47, 270, 354, 73, 14, 20, 7, 20, 83, 104, 80, 99, 83, 69, 105, 86, 73, 9, 59, 33, 1, 0, 19, 99, 100, 113, 91, 84, 80, 71, 52, 86, 77, 32, 30, 26, 2, 98, 656, 619, 456, 666, 632, 564, 624, 623, 558, 536, 36, 571, 585, 184, 252, 47, 9, 21, 66, 97, 68, 84, 97, 13, 11, 8, 6, 79, 39, 0, 3, 97, 105, 118, 128, 121, 66, 26, 34, 18, 0, 1, 2, 233, 610, 475, 554, 614,
+#> 587, 604, 539, 510, 516, 481, 336, 528, 12, 373, 316, 337, 2, 15, 447, 366, 477, 423, 478, 395, 448, 423, 530, 454, 480, 372, 348, 268, 242, 134, 24, 567, 543, 524, 550, 570, 524, 489, 480, 540, 499, 523, 543, 200, 60, 67, 378, 510, 411, 526, 554, 517, 482, 527, 533, 457, 165, 344, 390, 99, 37, 151, 11, 89, 87, 91, 78, 67, 90, 83, 97, 90, 108, 85, 104, 77, 49, 56, 29, 10, 54, 67, 78, 98, 109, 118, 96, 54, 71, 68, 47, 63, 64, 3, 3, 555, 617, 602, 528, 615, 589, 534, 113, 199, 407, 32, 329, 2, 41,
+#> 12, 421, 360, 404, 372, 439, 379, 426, 334, 236, 412, 119, 174, 317, 289, 372, 331, 243, 150, 126, 106, 595, 620, 634, 636, 633, 590, 606, 423, 158, 538, 553, 173, 324, 490, 218, 92, 77, 150, 19, 8, 29, 4, 50, 63, 57, 50, 85, 43, 67, 41, 6, 0, 497, 573, 558, 499, 568, 469, 541, 595, 594, 374, 495, 610, 126, 123, 14, 425, 2, 623, 462, 535, 493, 499, 599, 584, 418, 370, 50, 109, 109, 90, 10, 6, 61, 67, 55, 19, 4, 120, 61, 79, 52, 17, 8, 1, 63, 75, 94, 84, 87, 102, 80, 86, 88, 72, 62, 25, 67, 47, 74,
+#> 25, 35, 28, 279, 593, 540, 618, 491, 128, 13, 124, 343, 289, 60, 163, 435, 545, 521, 497, 566, 580, 582, 593, 534, 545, 527, 396, 536, 525, 549, 380, 399, 451, 68, 4, 5, 8, 361, 524, 580, 681, 649, 580, 506, 562, 543, 428, 7, 31, 98, 117, 107, 74, 81, 67, 69, 78, 66, 75, 26, 1, 449, 593, 619, 46, 594, 556, 500, 573, 67, 270, 523, 402, 6, 82, 223, 384, 661, 649, 644, 643, 560, 658, 589, 661, 660, 630, 606, 578, 541, 204, 157, 4, 26, 591, 621, 438, 405, 620, 506, 594, 621, 554, 404, 56, 36, 535, 516,
+#> 517, 220, 628, 634, 519, 350, 268, 256, 489, 496, 208, 13, 1, 413, 323, 599, 454, 539, 572, 339, 269, 281, 228, 86, 377, 550, 565, 483, 583, 396, 577, 194, 57, 637, 621, 599, 462, 508, 541, 610, 503, 534, 594, 272, 525, 415, 7, 73, 113, 87, 79, 7, 67, 84, 15, 21, 30, 52, 23, 21, 53, 11, 73, 72, 26, 67, 87, 67, 79, 71, 48, 20, 22, 39, 7, 14, 24, 345, 585, 649, 589, 437, 537, 438, 577, 599, 535, 569, 175, 168, 255, 189, 308, 265, 136, 26, 297, 489, 612, 452, 525, 526, 574, 294, 516, 566, 592, 543,
+#> 585, 57, 582, 503, 497, 492, 128, 178, 60, 402, 427, 561, 582, 609, 641, 603, 586, 553, 533, 383, 597, 323, 240, 542, 270, 581, 566, 573, 529, 583, 575, 530, 198, 204, 25, 42, 91, 95, 92, 101, 84, 85, 85, 71, 62, 73, 85, 4, 47, 40, 3, 46, 63, 74, 92, 81, 25, 49, 34, 39, 51, 11, 83, 83, 77, 67, 28, 0, 4, 11, 14, 5, 13, 45, 81, 45, 4, 43, 22, 585, 612, 606, 501, 624, 382, 121, 563, 458, 40, 411, 487, 300, 75, 92, 85, 49, 0, 8, 2, 414, 560, 531, 564, 579, 473, 541, 377, 586, 560, 388, 23, 274, 332,
+#> 137, 104, 56, 515, 385, 605, 615, 476, 560, 460, 113, 35, 187, 86, 51, 96, 96, 55, 75, 41, 1, 1, 13, 10, 11, 0, 279, 639, 568, 648, 631, 648, 588, 561, 265, 7, 79, 51, 55, 121, 114, 11, 99, 109, 124, 115, 113, 109, 127, 129, 107, 114, 89, 89, 80, 46, 25, 24, 133, 235, 324, 204, 35, 151, 116, 95, 431, 504, 377, 334, 203, 395, 416, 288, 115, 85, 180, 284, 139, 3, 41, 61, 502, 431, 356, 585, 568, 424, 151, 370, 316, 166, 491, 364, 111, 2, 0, 0, 93, 11, 73, 108, 75, 25, 124, 97, 18, 107, 88, 11, 75,
+#> 44, 15, 15, 88, 86, 19, 62, 42, 29, 7, 15, 2, 6, 23, 83, 36, 20, 76, 75, 95, 73, 57, 78, 52, 16, 1, 16, 83, 640, 630, 618, 603, 564, 472, 581, 580, 504, 212, 40, 180, 182, 413, 350, 417, 332, 387, 368, 489, 450, 376, 398, 309, 295, 373, 368, 238, 110, 2, 97, 152, 69, 292, 448, 520, 524, 459, 408, 76, 102, 87, 87, 101, 103, 76, 59, 69, 26, 17, 72, 31, 24, 47, 3, 592, 489, 549, 568, 470, 519, 149, 226, 225, 141, 458, 567, 616, 588, 538, 543, 376, 562, 550, 541, 368, 535, 547, 582, 566, 477, 563, 544,
+#> 512, 552, 550, 438, 525, 529, 22, 53, 94, 99, 115, 120, 25, 124, 98, 95, 72, 83, 81, 60, 56, 48, 21, 16, 11, 67, 39, 5, 82, 95, 101, 88, 10, 67, 79, 78, 53, 80, 83, 59, 16, 21, 10, 10, 565, 561, 456, 522, 514, 528, 509, 566, 334, 531, 10, 91, 386, 320, 400, 420, 411, 272, 310, 38, 75, 195, 88, 300, 96, 121, 137, 64, 35, 120, 117, 106, 99, 90, 107, 61, 55, 45, 15, 2, 95, 75, 53, 26, 40, 57, 105, 47, 19, 59, 68, 55, 63, 51, 0, 135, 490, 515, 524, 198, 501, 484, 563, 543, 523, 586, 333, 43, 28, 51,
+#> 0, 304, 231, 197, 503, 487, 587, 448, 441, 242, 69, 10, 187, 613, 337, 184, 360, 365, 440, 162, 147, 572, 475, 576, 571, 534, 526, 523, 584, 541, 379, 30, 44, 375, 5, 248, 505, 188, 316, 431, 465, 439, 63, 159, 250, 581, 385, 110, 179, 156, 13, 398, 500, 507, 544, 512, 163, 538, 151, 247, 116, 51, 62, 1, 12, 220, 491, 532, 588, 608, 582, 559, 296, 487, 494, 299, 58, 170, 88, 62, 10, 60, 296, 569, 585, 534, 576, 536, 421, 299, 545, 468, 266, 172, 57, 577, 459, 498, 508, 537, 438, 463, 251, 8, 21,
+#> 61, 41, 71, 97, 91, 84, 114, 30, 42, 42, 78, 15, 29, 11, 78, 55, 48, 43, 392, 534, 517, 526, 567, 476, 528, 608, 54, 465, 204, 58, 120, 378, 602, 530, 475, 509, 565, 512, 529, 524, 353, 198, 525, 382, 645, 454, 549, 606, 110, 241, 10, 34, 7, 78, 28, 2, 26, 13, 0, 18, 36, 80, 109, 77, 60, 13, 16, 7, 79, 41, 28, 4, 1, 3, 0, 7, 71, 58, 93, 8, 11, 5, 64, 22, 19, 29, 11, 560, 292, 225, 536, 480, 423, 388, 127, 221, 78, 140, 44, 3, 3, 7, 66, 103, 112, 77, 65, 77, 5, 72, 48, 15, 3, 4, 395, 604, 516, 425,
+#> 591, 609, 551, 549, 568, 556, 409, 510, 492, 125, 267, 9, 223, 83, 209, 138, 18, 99, 293, 396, 487, 358, 519, 429, 450, 465, 543, 214, 471, 464, 481, 246, 176, 221, 40, 635, 556, 335, 590, 458, 405, 538, 1, 576, 587, 543, 581, 624, 427, 573, 398, 541, 558, 246, 28, 17, 102, 86, 66, 91, 61, 2, 22, 37, 50, 74, 76, 75, 63, 31, 45, 49, 22, 68, 34, 74, 74, 95, 112, 31, 58, 42, 32, 2, 66, 84, 2, 75, 98, 72, 6, 0, 30, 69, 5, 60, 60, 71, 97, 1, 12, 94, 49, 68, 203, 629, 570, 592, 578, 506, 391, 20, 314,
+#> 2, 575, 512, 559, 571, 450, 562, 635, 610, 628, 377, 295, 129, 165, 365, 6, 56, 9, 69, 83, 70, 103, 100, 94, 26, 6, 67, 13, 14, 0, 55, 80, 31, 40, 7, 3, 73, 33, 7, 4, 0, 435, 547, 485, 418, 506, 430, 498, 540, 567, 515, 372, 186, 7, 234, 397, 344, 307, 386, 421, 365, 461, 84, 198, 259, 125, 68, 620, 621, 638, 565, 604, 490, 480, 67, 177, 308, 17, 158, 6, 375, 463, 329, 588, 590, 577, 571, 583, 595, 579, 184, 400, 51, 592, 296, 494, 446, 329, 327, 40, 442, 282, 5, 57, 31, 50, 75, 91, 133, 102, 103,
+#> 68, 69, 14, 63, 52, 44, 9, 0, 14, 34, 73, 25, 21, 2, 62, 71, 60, 68, 64, 41, 7, 633, 276, 396, 368, 322, 126, 2, 2, 47, 467, 617, 568, 624, 587, 611, 612, 555, 578, 578, 593, 591, 562, 594, 502, 472, 341, 331, 372, 433, 337, 2, 12, 55, 73, 92, 87, 105, 112, 64, 50, 40, 42, 16, 19, 200, 438, 449, 397, 18, 280, 515, 290, 307, 147, 337, 47, 342, 349, 137, 158, 15, 111, 68, 78, 493, 540, 14, 4, 356, 528, 496, 580, 342, 452, 25, 19, 274, 643, 632, 487, 571, 515, 157, 2, 326, 88, 0, 1, 40, 60, 52, 65,
+#> 120, 109, 103, 96, 92, 91, 74, 29, 46, 8, 13, 0, 129, 551, 527, 560, 581, 538, 541, 486, 555, 540, 482, 531, 480, 272, 208, 160, 282, 478, 601, 537, 259, 4, 21, 498, 597, 473, 1, 540, 248, 169, 343, 5, 37, 2, 9, 105, 79, 55, 53, 15, 72, 61, 13, 147, 509, 525, 595, 500, 545, 604, 468, 583, 561, 527, 541, 586, 402, 10, 328, 17, 13, 70, 20, 593, 454, 225, 154, 556, 531, 393, 540, 535, 607, 576, 529, 408, 181, 81, 155, 540, 459, 583, 573, 565, 323, 41, 443, 575, 597, 485, 528, 360, 565, 575, 555, 310,
+#> 126, 307, 104, 19, 103, 130, 402, 8, 87, 75, 4, 257, 313, 300, 234, 139, 120, 115, 99, 37, 1, 0, 6, 15, 2, 73, 91, 56, 22, 41, 24, 38, 27, 30, 2, 41, 79, 54, 27, 2, 5, 68, 74, 55, 84, 39, 3, 9, 67, 179, 61, 257, 501, 77, 109, 241, 488, 571, 13, 523, 328, 464, 21, 589, 458, 329, 268, 55, 193, 346, 482, 530, 614, 498, 510, 459, 334, 360, 256, 206, 63, 21, 158, 4, 9, 366, 522, 555, 511, 519, 513, 220, 14, 58, 469, 534, 234, 513, 548, 519, 514, 277, 178, 551, 516, 510, 252, 93, 220, 164, 142, 0, 42,
+#> 68, 57, 83, 83, 82, 77, 58, 55, 29, 39, 70, 74, 90, 41, 50, 72, 56, 36, 61, 7, 0, 6, 8, 558, 629, 631, 636, 568, 618, 585, 380, 322, 29, 36, 3, 7, 1, 0, 81, 75, 9, 89, 17, 72, 39, 5, 8, 50, 90, 101, 74, 45, 59, 4, 4, 77, 473, 183, 264, 606, 3, 310, 141, 172, 14, 471, 607, 501, 202, 535, 370, 276, 19, 531, 621, 553, 587, 600, 558, 584, 90, 327, 546, 569, 608, 597, 538, 403, 270, 355, 91, 8, 5, 514, 567, 434, 87, 588, 368, 522, 641, 598, 276, 152, 460, 93, 233, 429, 345, 80, 310, 1, 160, 330, 252,
+#> 326, 331, 283, 74, 82, 1, 225, 627, 579, 506, 539, 584, 345, 515, 538, 560, 475, 260, 273, 2, 28, 31, 43, 87, 65, 68, 82, 84, 36, 1, 68, 31, 3, 47, 15, 8, 1, 510, 261, 25, 555, 483, 559, 247, 506, 527, 515, 83, 30, 26, 418, 337, 266, 307, 234, 172, 241, 279, 259, 172, 229, 81, 81, 19, 540, 541, 589, 610, 595, 532, 592, 578, 556, 564, 630, 490, 329, 96, 12, 27, 94, 107, 115, 97, 102, 52, 14, 71, 68, 17, 8, 2, 312, 595, 564, 542, 476, 566, 617, 531, 616, 559, 524, 554, 553, 572, 330, 147, 418, 584,
+#> 622, 534, 513, 648, 605, 588, 639, 486, 3, 134, 602, 617, 594, 495, 554, 449, 516, 483, 484, 517, 302, 22, 293, 469, 415, 597, 547, 534, 503, 584, 541, 521, 482, 433, 472, 359, 395, 232, 147, 9, 2, 67, 57, 85, 63, 89, 83, 78, 81, 76, 85, 41, 50, 206, 471, 347, 293, 538, 483, 565, 550, 588, 411, 151, 292, 471, 286, 148, 142, 36, 141, 94, 3, 57, 5, 1, 56, 106, 48, 19, 89, 82, 32, 5, 5, 0, 502, 565, 555, 549, 547, 531, 516, 414, 148, 557, 321, 6, 40, 18, 97, 74, 62, 34, 63, 19, 0, 34, 13, 4, 0, 6, 43,
+#> 98, 90, 111, 106, 116, 112, 105, 101, 81, 105, 94, 108, 104, 95, 94, 98, 90, 59, 35, 21, 401, 510, 587, 537, 499, 298, 469, 66, 397, 357, 71, 41, 590, 574, 593, 518, 548, 510, 484, 386, 317, 357, 461, 520, 525, 522, 425, 538, 446, 235, 118, 140, 33, 162, 143, 341, 379, 359, 308, 280, 291, 53, 446, 403, 268, 137, 101, 4, 5, 89, 56, 119, 108, 136, 102, 124, 112, 98, 78, 93, 46, 13, 4, 40, 81, 83, 86, 85, 69, 63, 64, 33, 0, 114, 138, 180, 87, 238, 251, 371, 397, 411, 376, 105, 135, 377, 225, 63, 7,
+#> 26, 70, 68, 84, 70, 67, 18, 6, 8, 0, 5, 0, 34, 60, 54, 9, 1, 13, 543, 529, 587, 646, 589, 647, 644, 475, 206, 413, 583, 464, 64, 477, 141, 198, 32, 36, 43, 46, 24, 40, 8, 0, 7, 68, 445, 291, 355, 484, 561, 138, 388, 485, 200, 166, 86, 411, 282, 18, 80, 114, 98, 81, 84, 94, 34, 19, 46, 333, 391, 608, 559, 501, 285, 130, 440, 94, 295, 257, 481, 515, 43, 247, 443, 317, 6, 105, 5, 44, 2, 77, 481, 596, 561, 582, 508, 520, 579, 546, 550, 579, 475, 413, 197, 215, 127, 22, 31, 19, 474, 450, 437, 521, 489,
+#> 481, 550, 522, 464, 363, 144, 47, 279, 436, 437, 505, 468, 519, 397, 446, 388, 330, 96, 97, 103, 47, 117, 111, 74, 60, 12, 105, 36, 20, 471, 370, 89, 30, 285, 514, 509, 550, 572, 550, 385, 444, 492, 477, 450, 120, 58, 21, 19, 62, 62, 92, 71, 34, 32, 29, 27, 12, 2, 2, 0, 515, 553, 471, 549, 464, 614, 617, 540, 578, 413, 307, 143, 52, 447, 522, 362, 42, 10, 300, 96, 183, 157, 41, 559, 360, 132, 459, 606, 320, 453, 361, 223, 52, 162, 151, 39, 179, 27, 5, 2, 40, 56, 78, 93, 69, 34, 19, 65, 38, 12, 2,
+#> 0, 34, 2, 3, 17, 37, 19, 14, 50, 3, 13, 8, 2, 0, 335, 437, 364, 549, 620, 667, 425, 479, 547, 523, 523, 395, 411, 93, 10, 83, 160, 552, 620, 606, 534, 590, 584, 538, 542, 508, 327, 370, 235, 233, 158, 354, 167, 86, 95, 97, 96, 96, 45, 60, 14, 11, 77, 41, 7, 7, 446, 662, 637, 589, 596, 609, 596, 405, 401, 502, 133, 67, 64, 0, 582, 572, 608, 1, 32, 439, 547, 503, 447, 519, 513, 577, 491, 504, 416, 247, 58, 55, 402, 555, 541, 394, 533, 438, 539, 503, 434, 337, 464, 127, 565, 580, 578, 585, 600, 575,
+#> 595, 572, 621, 596, 578, 558, 552, 486, 498, 403, 478, 417, 195, 49, 209, 30, 66, 112, 69, 48, 63, 5, 40, 70, 0, 29, 8, 7, 16, 1, 53, 75, 15, 40, 51, 70, 91, 89, 57, 57, 21, 37, 66, 72, 96, 38, 3, 41, 22, 56, 35, 23, 10, 16, 8, 13, 7, 0, 5, 0, 33, 20, 116, 530, 357, 152, 540, 525, 567, 395, 520, 261, 151, 378, 236, 15, 2, 75, 81, 46, 19, 30, 1, 8, 36, 17, 0, 3, 30, 10, 0, 341, 549, 461, 543, 517, 533, 474, 519, 541, 527, 514, 377, 172, 465, 361, 333, 440, 435, 44, 67, 102, 87, 112, 123, 122, 107,
+#> 100, 80, 99, 89, 79, 33, 52, 79, 68, 35, 21, 10, 16, 45, 540, 486, 437, 211, 6, 36, 58, 363, 587, 70, 458, 265, 145, 498, 242, 317, 374, 6, 9, 5, 44, 554, 573, 567, 599, 466, 492, 416, 80, 679, 656, 620, 591, 624, 561, 561, 474, 471, 487, 417, 351, 120, 59, 3, 159, 605, 607, 538, 594, 617, 555, 553, 557, 439, 588, 525, 334, 372, 235, 565, 606, 659, 408, 640, 642, 553, 620, 564, 610, 553, 334, 153, 394, 254, 427, 3, 226, 120, 143, 5, 24, 19, 3, 0, 46, 79, 98, 88, 63, 43, 29, 0, 20, 1, 0, 3, 176, 163,
+#> 164, 187, 244, 190, 48, 70, 25, 16, 9, 32, 1, 32, 1, 0, 1, 2, 635, 593, 540, 516, 290, 543, 469, 463, 244, 343, 118, 89, 10, 379, 531, 538, 607, 497, 570, 573, 612, 517, 127, 301, 101, 122, 181, 263, 14, 201, 542, 597, 559, 555, 537, 513, 463, 375, 47, 45, 172, 0, 25, 16, 62, 98, 82, 89, 72, 84, 101, 34, 15, 1, 9, 21, 0, NA, 0, 0, 0, 0, 1, 36, 60, 60, 72, 71, 65, 66, 69, 88, 64, 0, 45, 30, 0, 20, 16, 84, 87, 11, 11, 52, 30, 6, 0, 534, 509, 71, 561, 604, 519, 409, 599, 663, 554, 473, 481, 3, 3, 13,
+#> 247, 457, 604, 648, 624, 631, 636, 649, 619, 623, 624, 605, 606, 621, 539, 442, 41, 528, 579, 476, 499, 552, 572, 546, 594, 548, 572, 536, 547, 502, 546, 452, 108, 328, 52, 28, 504, 588, 617, 577, 543, 511, 551, 586, 398, 551, 525, 399, 479, 458, 327, 456, 467, 405, 278, 310, 558, 36, 75, 62, 86, 78, 42, 73, 65, 53, 96, 85, 92, 67, 82, 18, 13, 35, 593, 596, 538, 594, 617, 589, 597, 511, 610, 432, 591, 612, 511, 573, 552, 565, 222, 83, 81, 88, 41, 79, 56, 49, 47, 29, 25, 20, 25, 11, 31, 1, 11, 2,
+#> 0, 533, 575, 557, 612, 600, 625, 581, 601, 578, 564, 659, 546, 622, 599, 552, 491, 436, 499, 572, 611, 554, 540, 464, 545, 609, 482, 568, 582, 576, 479, 421, 539, 471, 455, 342, 534, 427, 50, 118, 67, 530, 595, 544, 570, 563, 552, 589, 611, 617, 628, 535, 496, 180, 166, 24, 221, 34, 468, 602, 609, 615, 601, 629, 590, 603, 592, 631, 570, 570, 603, 600, 606, 547, 516, 495, 449, 392, 340, 465, 271, 2, 17, 51, 77, 79, 91, 87, 57, 70, 102, 99, 83, 68, 67, 56, 56, 31, 9, 0, 1, 35, 53, 79, 86, 86, 88, 99,
+#> 104, 91, 103, 51, 26, 31, 43, 1, 6, 20, 8, 0, 20, 103, 634, 627, 604, 595, 590, 619, 580, 537, 364, 155, 62, 32, 38, 284, 396, 310, 375, 334, 316, 426, 450, 351, 421, 505, 421, 337, 220, 73, 16, 516, 14, 569, 556, 568, 517, 545, 568, 556, 570, 591, 540, 97, 315, 31, 8, 2, 199, 540, 557, 588, 470, 479, 448, 393, 246, 399, 505, 468, 320, 13, 379, 528, 220, 431, 559, 512, 568, 617, 169, 557, 415, 339, 3, 89, 59, 72, 74, 74, 98, 94, 30, 7, 25, 22, 15, 3, 15, 18, 94, 75, 89, 81, 100, 95, 84, 99, 103,
+#> 106, 104, 51, 18, 47, 71, 25, 279, 290, 356, 376, 443, 323, 446, 494, 487, 550, 391, 410, 116, 199, 203, 2, 18, 81, 82, 46, 57, 88, 46, 55, 21, 12, 14, 25, 462, 596, 530, 467, 385, 205, 595, 580, 563, 611, 541, 221, 45, 48, 197, 368, 366, 576, 610, 459, 536, 585, 406, 542, 352, 535, 227, 7, 161, 585, 474, 515, 601, 609, 417, 317, 486, 484, 471, 52, 124, 94, 255, 112, 123, 3, 162, 460, 380, 520, 560, 600, 556, 478, 297, 336, 44, 58, 30, 255, 526, 567, 493, 538, 558, 572, 534, 601, 494, 621, 639, 506,
+#> 227, 367, 193, 64, 228, 255, 382, 463, 440, 311, 383, 427, 518, 537, 30, 350, 259, 195, 140, 108, 14, 97, 93, 73, 93, 9, 68, 61, 83, 67, 56, 52, 11, 19, 2, 70, 168, 19, 570, 552, 580, 574, 578, 544, 548, 535, 498, 530, 138, 80, 82, 427, 614, 578, 265, 360, 3, 603, 605, 569, 585, 625, 579, 529, 34, 49, 452, 563, 600, 573, 567, 250, 84, 3, 550, 107, 148, 21, 455, 577, 510, 588, 594, 562, 374, 479, 50, 423, 571, 420, 197, 143, 58, 33, 77, 5, 44, 52, 52, 51, 61, 97, 87, 94, 73, 88, 79, 91, 86, 71, 71,
+#> 11, 29, 0, 32, 37, 13, 17, 9, 14, 10, 10, 1, 5, 0, 6, 15, 69, 98, 92, 47, 120, 106, 70, 77, 108, 99, 91, 93, 84, 101, 86, 75, 90, 75, 37, 54, 11, 136, 448, 473, 616, 477, 341, 508, 64, 253, 351, 42, 52, 429, 511, 516, 505, 451, 523, 243, 164, 89, 19, 35, 570, 501, 556, 519, 527, 492, 438, 168, 496, 469, 189, 72, 192, 260, 328, 229, 564, 364, 540, 502, 456, 523, 491, 495, 329, 263, 383, 344, 413, 24, 202, 478, 351, 353, 113, 2, 10, 77, 57, 63, 90, 85, 80, 36, 21, 1, 0, 41, 32, 52, 63, 57, 63, 62,
+#> 96, 94, 19, 45, 23, 61, 82, 66, 27, 22, 44, 117, 463, 313, 595, 668, 634, 589, 612, 559, 620, 610, 608, 598, 608, 589, 556, 549, 553, 482, 218, 47, 7, 4, 115, 168, 64, 466, 460, 522, 508, 405, 394, 364, 109, 274, 523, 515, 494, 534, 534, 396, 298, 364, 158, 7, 48, 143, 358, 182, 401, 433, 499, 590, 590, 312, 513, 155, 348, 410, 310, 508, 29, 517, 554, 591, 614, 658, 631, 543, 577, 308, 385, 57, 384, 521, 520, 501, 584, 593, 573, 596, 678, 631, 636, 587, 584, 26, 70, 19, 4, 530, 533, 196, 482, 575,
+#> 587, 74, 498, 87, 275, 185, 91, 145, 30, 29, 21, 448, 267, 493, 417, 433, 516, 493, 519, 598, 592, 566, 549, 33, 287, 227, 215, 288, 464, 457, 465, 282, 538, 561, 478, 237, 273, 262, 559, 337, 123, 8, 61, 68, 62, 72, 89, 35, 21, 4, 19, 10, 41, 11, 29, 30, 5, 18, 44, 29, 19, 15, 32, 16, 3, 6, 5, 32, 74, 30, 29, 26, 17, 21, 22, 16, 8, 22, 11, 13, 2, 8, 24, 9, 7, 2, NA, 0, 64, 70, 66, 10, 14, 3, 5, 26, 7, 305, 182, 469, 460, 662, 692, 630, 679, 664, 610, 0, 82, 103, 73, 88, 80, 93, 108, 24, 35, 7, 3,
+#> 17, 2, 19, 69, 384, 397, 287, 394, 389, 470, 414, 437, 445, 334, 380, 361, 86, 474, 543, 451, 519, 432, 570, 572, 538, 600, 622, 589, 638, 585, 502, 507, 412, 522, 378, 96, 648, 652, 607, 619, 652, 625, 669, 618, 650, 499, 495, 574, 566, 484, 466, 406, 319, 242, 516, 613, 695, 527, 630, 650, 594, 616, 627, 434, 189, 522, 601, 132, 61, 66, 50, 19, 15, 13, 10, 0, 33, 47, 529, 618, 612, 645, 645, 648, 634, 642, 642, 636, 594, 574, 576, 404, 520, 351, 8, 104, 353, 535, 507, 493, 479, 467, 603, 488, 411,
+#> 483, 370, 452, 440, 363, 149, 9, 322, 461, 489, 588, 555, 583, 601, 597, 588, 592, 533, 190, 191, 113, 91, 56, 219, 371, 312, 345, 421, 21, 229, 205, 251, 377, 337, 323, 360, 264, 5, 171, 77, 67, 60, 3, 0, 3, 0, 32, 35, 45, 89, 90, 50, 53, 49, 8, 26, 56, 4, 32, 2, 5, 25, 4, 0, 25, 43, 13, 25, 1, 35, 50, 45, 25, 20, 16, 16, 9, 16, 19, 11, 0, 221, 129, 98, 453, 612, 550, 641, 517, 549, 433, 162, 49, 12, 6, 42, 4, 71, 17, 41, 49, 66, 106, 87, 35, 49, 14, 6, 0, 26, 73, 66, 91, 83, 83, 111, 96, 110, 130,
+#> 106, 93, 79, 22, 1, 14, 63, 100, 61, 83, 93, 118, 99, 77, 87, 76, 93, 45, NA, 0, 1, NA, 79, 53, 48, NA, 1, NA, 35, 8, 12, 4, 28, 661, 566, 434, 469, 363, 436, 485, 460, 297, 271, 305, 295, 272, 303, 37, 8, 622, 520, 533, 602, 537, 448, 507, 331, 143, 6, 3, 3, 1, 76, 90, 83, 80, 61, 23, 56, 89, 69, 48, 6, 1, 352, 460, 665, 556, 592, 60, 313, 577, 456, 79, 454, 42, 213, 200, 219, 82, 26, 552, 626, 460, 219, 19, 26, 19, 0, 45, 81, 66, 83, 80, 107, 41, 58, 35, 4, 31, 29, 37, 27, 2, 9, 4, 0, 2, 4, 30,
+#> 26, 26, 16, 7, 13, 17, 11, 12, 8, 4, 1, 11, 6, 0, 4, 2, 12, 17, 26, 49, 54, 57, 77, 69, 110, 74, 113, 118, 583, 646, 570, 567, 494, 594, 579, 539, 603, 566, 508, 455, 540, 515, 543, 546, 558, 523, 518, 364, 338, 459, 380, 59, 45, 510, 568, 621, 659, 666, 543, 581, 403, 217, 75, 194, 145, 452, 495, 423, 371, 282, 209, 230, 496, 458, 317, 332, 250, 117, 1, 3, 422, 208, 396, 335, 635, 662, 679, 617, 626, 514, 618, 606, 35, 14, 311, 418, 283, 394, 89, 363, 71, 370, 501, 340, 18, 0, 0, 3, 0, 81, 120,
+#> 72, 81, 99, 72, 71, 82, 96, 30, 623, 516, 670, 654, 585, 626, 627, 649, 632, 645, 680, 652, 662, 665, 655, 655, 628, 655, 431, 634, 493, 96, 278, 405, 237, 138, 580, 613, 531, 585, 501, 380, 513, 213, 279, 427, 214, 11, 112, 31, 59, 89, 112, 97, 98, 112, 79, 123, 109, 85, 105, 51, 69, NA, 2, 64, 104, 288, 455, 603, 626, 654, 619, 612, 556, 398, 495, 477, 290, 275, 136, 26, 28, 66, 76, 87, 96, 104, 100, 60, 94, 118, 109, 87, 103, 65, 81, 28, 5, 65, 80, 89, 75, 76, 92, 93, 24, 42, 0, 21, 370, 577,
+#> 505, 344, 359, 339, 180, 71, 98, 183, 295, 368, 64, 83, 23, 48, 77, 27, 6, 347, 578, 604, 630, 592, 608, 561, 586, 577, 575, 555, 555, 464, 536, 375, 76, 264, 381, 226, 217, 299, 184, 23, 417, 41, 27, 9, 7, 672, 576, 622, 557, 470, 637, 628, 487, 28, 571, 459, 455, 123, 24, 632, 619, 524, 463, 521, 438, 459, 549, 506, 250, 462, 416, 298, 171, 254, 397, 438, 532, 394, 612, 603, 538, 91, 87, 51, 13, 80, 99, 31, 31, 546, 442, 541, 552, 515, 577, 401, 569, 547, 295, 555, 527, 500, 433, 248, 333, 312,
+#> 27, 175, 592, 505, 602, 611, 590, 614, 580, 601, 347, 340, 124, 157, 230, 191, 133, 56, 28, 20, 533, 475, 196, 479, 388, 529, 478, 367, 520, 443, 401, 403, 23, 2, 406, 220, 501, 601, 523, 546, 477, 424, 602, 624, 634, 544, 519, 529, 361, 310, 51, 15, 67, 31, 12, 27, 10, 29, 67, 3, 2, 0, 1, 10, 300, 520, 431, 492, 517, 540, 489, 395, 516, 374, 380, 445, 427, 237, 142, 198, 589, 565, 597, 557, 568, 379, 452, 578, 588, 554, 551, 195, 92, 102, 462, 419, 554, 451, 542, 269, 36, 101, 11, 102, 544, 544,
+#> 494, 286, 275, 314, 388, 169, 158, 346, 293, 468, 502, 257, 171, 74, 15, 497, 510, 522, 356, 401, 126, 111, 24, 10, 212, 47, 32, 66, 55, 57, 88, 53, 69, 22, 60, 97, 78, 28, 31, 16, 17, 9, 2, 3, 8, 37, 99, 80, 82, 91, 101, 85, 94, 80, NA, 0, 4, 283, 19, 19, 477, 616, 505, 361, 342, 475, 574, 582, 230, 464, 36, 25, 152, 174, 10, 555, 38, 31, 304, 421, 533, 485, 462, 435, 522, 474, 511, 495, 522, 508, 461, 428, 186, 390, 424, 202, 60, 73, 8, 5, 7, 46, 36, 18, 29, 13, 2, 5, 12, 13, 11, 16, 17, 7, NA,
+#> 1, 26, 11, 24, 1, 5, 6, 18, 8, 4, 17, 17, 8, 0, 14, 3, 13, 6, 486, 465, 590, 511, 494, 71, 345, 402, 161, 97, 14, 27, 12, 19, 629, 529, 368, 565, 636, 425, 422, 204, 62, 51, 209, 500, 579, 550, 474, 285, 426, 348, 347, 158, 1, 42, 542, 497, 507, 480, 575, 547, 518, 543, 452, 135, 87, 59, 12, 13, 400, 491, 424, 472, 491, 415, 550, 533, 526, 418, 465, 370, 344, 435, 293, 41, 13, 429, 528, 322, 379, 328, 311, 136, 236, 104, 8, 23, 69, 72, 73, 79, 32, 64, 108, 88, 76, 31, 17, 182, 247, 322, 415, 561,
+#> 565, 415, 555, 666, 574, 662, 476, 575, 461, 8, 324, 48, 280, 3, 3, 8, 21, 8, 7, 9, 1, 16, 3, 6, 0, 7, 1, 2, 17, 40, 63, 63, 41, 12, 21, 10, 20, 1, 15, 9, 8, 1, 0, 25, 281, 257, 600, 625, 629, 587, 609, 515, 564, 596, 511, 527, 559, 544, 489, 585, 306, 196, 253, 137, 183, 200, 11, 434, 547, 215, 419, 631, 643, 689, 660, 655, 664, 640, 621, 650, 635, 528, 498, 489, 298, 405, 59, 54, 99, 39, 41, 9, 53, 69, 59, 94, 44, 67, 48, 34, 1, 1, 22, 54, 66, 88, 80, 28, 46, 6, 41, 66, 84, 58, 66, 5, 25, 2, 601,
+#> 565, 350, 549, 480, 537, 578, 604, 604, 617, 606, 584, 412, 156, 146, 44, 1, 364, 303, 552, 421, 625, 480, 516, 477, 500, 552, 440, 375, 164, 125, 140, 5, 2, 214, 542, 475, 413, 468, 471, 614, 533, 427, 1, 15, 526, 539, 553, 522, 250, 21, 357, 368, 88, 180, 18, 4, 514, 461, 458, 191, 577, 535, 580, 599, 535, 605, 616, 564, 409, 540, 364, 523, 472, 329, 443, 77, 95, 91, 95, 92, 89, 93, 71, 95, 82, 55, 31, 74, 76, 46, 55, 34, 64, 0, 0, NA, NA, 24, 10, 67, 405, 465, 409, 543, 471, 434, 515, 164, 474,
+#> 239, 152, 331, 28, 106, 21, 59, 155, 169, 146, 137, 5, 250, 219, 564, 418, 594, 542, 495, 554, 404, 542, 481, 535, 412, 449, 117, 77, 1, 51, 0, 93, 100, 108, 113, 115, 109, 84, 2, NA, NA, NA, 0, 0, NA, NA, 67, 53, 14, 17, 10, 36, 64, 86, 64, 61, 70, 91, 82, 115, 89, NA, NA, NA, 54, 3, 6, 5, 37, 74, 93, 85, 111, 106, 31, 58, 12, 4, 26, 565, 558, 543, 580, 618, 467, 423, 517, 477, 225, 170, 488, 447, 234, 311, 35, 349, 11, 117, 235, 333, 583, 592, 568, 401, 435, 602, 394, 164, 214, 222, 151, 614, 656,
+#> 597, 643, 543, 591, 530, 474, 372, 172, 16, 86, 564, 532, 605, 562, 538, 557, 621, 530, 465, 494, 393, 464, 360, 178, 399, 310, 189, 51, 26, 89, 394, 476, 459, 372, 399, 356, 36, 276, 19, 217, 52, 22, 10, 7, 81, 60, 74, 79, 92, 0, NA, 0, 1, 0, 42, NA, 11, 14, 9, 9, NA, 0, 226, 139, 483, 210, 250, 80, 174, 79, 535, 46, 519, 39, 161, 43, 80, 512, 526, 401, 512, 508, 371, 450, 333, 411, 238, 615, 401, 4, 519, 169, 102, 122, 646, 335, 3, 38, 51, 65, 77, 38, 86, 94, 105, 74, 79, NA, NA, 21, 12, 309, 533,
+#> 580, 655, 664, 631, 617, 577, 577, 599, 601, 502, 119, 134, 431, 110, 3, 3, 12, 1, 5, 6, 16, 22, 15, 18, 96, 125, NA, 0, 0, NA, NA, NA, 12, 210, 328, 135, 187, 53, 274, 247, 121, 11, 1, 18, 12, 71, 93, 57, 103, 112, 107, 87, NA, NA, NA, NA, NA, 47, 501, 510, 504, 511, 530, 510, 376, 559, 454, 1, 156, 49, 89, 3, 19, 184, 472, 530, 459, 500, 285, 470, 493, 442, 522, 402, 348, 198, 268, 139, 50, 91, 136, 570, 652, 590, 577, 498, 638, 518, 676, 531, 314, 79, 129, 0, 114, 393, 504, 566, 557, 510, 514,
+#> 500, 572, 273, 496, 475, 98, 1, 5, 493, 542, 448, 574, 513, 518, 199, 327, 339, 472, 461, 321, 159, 261, 148, 86, 590, 340, 478, 439, 521, 504, 562, 266, 519, 351, 88, 330, 23, 118, 553, 549, 426, 567, 499, 539, 506, 593, 498, 525, 511, 465, 514, 334, 530, 397, 525, 460, 419, 336, 4, 323, 522, 491, 406, 535, 583, 553, 521, 356, 454, 402, 240, 2, 15, 72, 73, 80, 80, 96, 117, 100, 102, 90, 92, 97, 86, 94, 101, 67, 101, 97, 84, 28, NA, 34, 11, NA, NA, NA, 3, 200, 195, 76, 250, 324, 535, 550, 558, 698,
+#> 677, 609, 121, 404, 497, 11, 81, 15, 74, 495, 411, 509, 483, 506, 505, 375, 339, 461, 50, 40, 12, 14, 24, 19, 19, 8, 10, 7, 24, 24, 2, 3, 1, 0, 0, 5, 21, 10, 7, 10, NA, 3, NA, 9, 3, 35, 222, 563, 457, 612, 571, 478, 584, 129, 202, 396, 263, 136, 50, 91, 73, 60, 2, 51, 13, 53, 59, 42, 42, 93, 97, 92, 71, NA, NA, NA, 0, 68, 386, 511, 510, 212, 87, 352, 352, 403, 518, 470, 150, 295, 259, 63, 171, 101, 16, 0, 116, 450, 486, 457, 492, 204, 136, 276, 238, 34, 52, 6, 5, 32, 472, 443, 485, 504, 297, 463,
+#> 298, 409, 415, 267, 40, 162, 333, 569, 576, 484, 553, 574, 533, 448, 471, 170, 313, 404, 521, 558, 349, 506, 560, 266, 57, 86, 453, 451, 511, 519, 517, 597, 616, 595, 617, 382, 7, 93, 77, 52, 94, 89, 94, 45, 2, 26, 19, 56, 95, 60, 82, 85, 92, 105, 73, 59, NA, 12, NA, 8, 22, 39, 74, 71, 77, 83, 29, 2, NA, NA, NA, 69, 93, 265, 278, 637, 589, 604, 457, 357, 506, 272, 16, 74, 21, 10, 15, 102, 45, 1, 0, NA, NA, 1, 79, 83, 68, 35, NA, NA, 30, 43, 59, 93, 620, 555, 540, 583, 552, 470, 592, 478, 486, 577,
+#> 394, 372, 475, 356, 97, 307, 622, 663, 619, 626, 643, 567, 529, 378, 592, 90, 475, 538, 231, 163, 88, 339, 600, 515, 613, 558, 624, 569, 643, 498, 593, 641, 615, 599, 611, 350, 169, 493, 56, 37, 99, 540, 402, 395, 564, 547, 418, 356, 331, 73, 359, 269, 103, 71, 180, 415, 466, 572, 67, 400, 562, 641, 600, 625, 554, 602, 404, 534, 447, 389, 170, 122, 1, 19, 497, 565, 459, 413, 383, 184, 190, 348, 86, 77, 340, 521, 626, 528, 621, 391, 384, 47, 414, 487, 551, 542, 406, 132, 156, 37, 69, 564, 581, 529,
+#> 585, 616, 606, 526, 533, 554, 499, 190, 264, 297, 117, 141, 22, 64, 190, 338, 491, 301, 321, 208, 188, 140, 126, 108, 76, 4, 26, 73, 13, 64, 113, 102, 98, NA, NA, NA, NA, NA, NA, NA, 0, NA, NA, NA, NA, 4, 75, 438, 559, 607, 605, 553, 592, 545, 556, 580, 530, 585, 556, 456, 222, 55, 91, 96, 459, 486, 533, 520, 589, 596, 481, 389, 571, 220, 74, 48, 0, 6, 8, 0, 13, 14, 7, NA, NA, NA, NA, 2, NA, 2, 24, 7, 35, 74, 84, 82, 25, 16, 17, 10, 13, 9, 10, 4, 2, 0, 25, 37, 601, 425, 494, 20, 535, 548, 583, 552,
+#> 576, 512, 498, 472, 521, 441, 436, 461, 308, 463, 404, 365, 38, 105, 179, 227, 510, 484, 498, 417, 437, 401, 463, 316, 129, 124, 62, 13, 18, 56, 64, 86, 91, 97, 117, 120, 98, 110, NA, NA, 0, NA, NA, NA, 87, 71, NA, NA, 48, NA, NA, 0, 55, 483, 470, 396, 312, 287, 127, 6, 5, 48, 457, 508, 187, 263, 487, 536, 571, 320, 478, 338, 476, 488, 359, 543, 457, 454, 253, 375, 452, 460, 188, 53, 11, 133, 514, 447, 444, 582, 320, 193, 576, 625, 527, 516, 515, 502, 63, 75, 2, 355, 611, 559, 525, 610, 500, 575,
+#> 530, 192, 470, 499, 306, 492, 332, 380, 220, 76, 78, 547, 650, 579, 446, 669, 583, 624, 624, 654, 539, 540, 360, 499, 499, 391, 195, 19, 11, 78, 65, 79, 70, 88, 50, NA, NA, NA, NA, NA, NA, 43, 181, 122, 350, 513, 593, 437, 593, 468, 500, 242, 497, 330, 372, 122, 193, 1, 66, 55, 199, 49, 450, 229, 54, 26, 83, 6, 601, 562, 542, 501, 487, 495, 531, 17, 501, 344, 388, 307, 530, 261, 33, 40, 118, 218, 155, 317, 171, 37, 8, 8, 17, 13, 3, 21, NA, 1, NA, 0, 0, NA, 0, 0, NA, 5, NA, 2, 2, 5, 30, 16, 5, 24,
+#> 29, 14, 10, 11, 14, 18, 19, NA, NA, 11, 0, 269, 578, 573, 601, 642, 547, 603, 569, 625, 601, 527, 509, 536, 552, 269, 239, 9, 210, 82, 143, 95, 30, 460, 581, 582, 524, 518, 181, 487, 534, 498, 352, 506, 387, 363, 479, 313, 14, 87, 118, 372, 413, 287, 445, 343, 20, 203, 97, 157, 321, 122, 114, 48, 24, 26, 98, 112, 2, 562, 641, 580, 572, 450, 481, 269, 123, 235, 259, 27, 0, 0, 15, 37, 21, 23, 4, NA, NA, NA, 1, NA, NA, NA, NA, 11, 356, 270, 349, 450, 518, 114, 569, 645, 392, 562, 378, 344, 95, 62, 540,
+#> 561, 425, 587, 555, 474, 631, 571, 359, 616, 446, 491, 298, 370, 42, 119, 9, 4, 148, 137, 503, 510, 427, 554, 594, 543, 515, 464, 501, 290, 215, 33, 24, 130, 605, 609, 502, 538, 535, 592, 498, 562, 550, 580, 540, 476, 254, 65, 0, 73, 35, 80, 100, 105, 69, 90, 0, 0, 2, NA, NA, NA, 10, NA, 43, 26, 44, 260, 418, 595, 571, 567, 139, 257, 461, 547, 562, 556, 357, 465, 523, 401, 505, 507, 499, 437, 276, 1, 16, 27, 50, 70, 95, 31, 1, 212, 278, 211, 434, 615, 553, 252, 554, 634, 625, 627, 466, 262, 497,
+#> 451, 262, 169, 216, 9, 27, 0, 11, 16, 22, 33, 34, 15, 6, 5, 1, NA, 0, 0, 0, 0, 3, 93, 225, 294, 349, 642, 659, 631, 646, 639, 648, 658, 431, 625, 388, 617, 654, 557, 76, 37, 435, 474, 507, 349, 202, 483, 384, 475, 42, 332, 287, 40, 59, 92, 82, 85, 90, 103, 105, 1, 0, NA, 1, NA, NA, NA, 8, 37, 82, 255, 324, 474, 501, 486, 492, 296, 356, 145, 118, 119, 87, 20, 77, 70, 93, 53, 89, 96, 108, 67, 34, NA, 22, 265, 327, 378, 328, 594, 507, 576, 572, 565, 590, 622, 421, 572, 528, 531, 560, 311, 279, 197,
+#> 302, 57, 573, 347, 264, 355, 124, 196, 12, 181, 65, 526, 554, 585, 604, 579, 488, 397, 278, 319, 285, 401, 71, 191, 415, 519, 541, 525, 494, 338, 125, 589, 322, 591, 469, 352, 284, 63, 559, 413, 272, 280, 122, 472, 582, 554, 221, 85, 230, 34, 367, 568, 562, 584, 544, 513, 541, 548, 354, 514, 534, 528, 549, 552, 522, 390, 148, 19, 75, 38, 64, 80, 62, 44, NA, NA, 15, 37, 333, 536, 504, 581, 531, 511, 503, 448, 357, 503, 285, 5, 19, 1, 0, NA, NA, 26, 8, 0, 0, 2, 2, 8, 3, 4, 0, 0, 25, 39, 33, 19, 1,
+#> 0, 1, 0, 20, 12, 12, 18, 0, 0, NA, NA, 77, 453, 514, 514, 533, 447, 311, 249, 494, 279, 568, 473, 403, 114, 399, 379, 326, 61, 45, 68, 36, 71, 87, 81, 32, 19, 56, NA, 0, 1, 1, NA, NA, NA, NA, 16, NA, 43, 528, 507, 497, 541, 531, 415, 256, 472, 437, 517, 448, 397, 396, 301, 90, 353, 196, 78, 426, 579, 592, 577, 587, 540, 605, 523, 260, 10, 458, 587, 538, 374, 52, 531, 571, 598, 548, 549, 323, 412, 324, 241, 218, 7, 67, 46, 35, 82, 75, 60, 2, 68, 79, 0, 15, 14, 80, 78, 49, 70, 42, 30, 15, 58, NA, 19,
+#> NA, NA, NA, 3, 76, 225, 549, 598, 557, 552, 566, 581, 583, 589, 587, 521, 324, 349, 405, 462, 395, 440, 354, 177, 93, 67, 564, 581, 644, 677, 619, 504, 451, 573, 626, 657, 546, 618, 404, 485, 209, 1, 383, 374, 461, 573, 522, 584, 539, 450, 527, 561, 361, 602, 526, 253, 396, 289, 48, 65, 83, 103, 43, 82, 86, 45, 17, 27, 12, 100, 563, 610, 302, 596, 533, 554, 540, 452, 368, 378, 583, 502, 412, 8, 463, 551, 529, 565, 654, 617, 628, 443, 568, 525, 492, 656, 421, 617, 614, 93, 339, 79, 187, 139, 220,
+#> 558, 537, 637, 581, 622, 518, 240, 244, 552, 607, 635, 637, 589, 377, 553, 610, 466, 36, 16, 0, NA, NA, NA, 23, NA, NA, 0, NA, NA, NA, 22, 11, 7, 4, 1, NA, 1, NA, NA, 0, 0, 3, 0, 1, 4, 13, 15, 7, 8, NA, NA, 1, 1, 3, 5, 19, 368, 105, 145, 39, 276, 463, 562, 615, 604, 440, 528, 414, 550, 601, 553, 452, 51, 233, 130, 223, 561, 63, 547, 604, 601, 555, 571, 507, 480, 306, 385, 343, 164, 175, 52, 257, 67, 20, 368, 472, 448, 453, 518, 495, 505, 339, 470, 378, 348, 367, 429, 139, 54, 91, 147, 57, 282, 463,
+#> 412, 501, 230, 497, 489, 463, 412, 609, 470, 630, 617, 529, 541, 559, 520, 445, 270, 480, 552, 252, 566, 560, 471, 360, 562, 194, 375, 341, 216, 205, 114, 6, 24, 59, 69, 51, 62, 79, 84, 69, 63, 74, 51, 64, 79, 66, 0, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 82, 75, 62, 98, 84, 88, 91, 84, 98, 80, 84, 73, 72, 77, 64, 51, 68, NA, NA, NA, NA, NA, NA, NA, 23, NA, NA, 1, 0, NA, NA, NA, NA, NA, 7, 10, 1, 6, 0, 1, 1, 15, 17, 6, 5, NA, 3, 7, NA, 2, NA, NA, NA, NA, 0, 0, 0, 8, 3, 4, 0, 62, 22, 42,
+#> 43, 16, 46, 38, 38, 4, 6, 1, 40, 457, 634, 645, 564, 510, 645, 449, 347, 552, 464, 377, 550, 441, 427, 589, 457, 544, 505, 592, 560, 51, 165, 337, 97, 338, 539, 480, 527, 641, 623, 393, 489, 389, 613, 589, 317, 320, 278, 32, NA, NA, 0, 0, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 1, 0, NA, 58, 25, 268, 159, 129, 466, 616, 590, 565, 559, 286, 247, 630, 399, 68, 309, 313, 2, 25, 599, 531, 552, 527, 84, 518, 420, 230, 544, 609, 410, 144, 19, 481, 62, 38, 16, 32, 51, 521, 488, 289,
+#> 361, 440, 435, 398, 480, 227, 472, 468, 450, 460, 442, 389, 352, 405, 117, 86, 227, 463, 562, 585, 614, 380, 544, 396, 484, 458, 399, 438, 292, 198, 399, 193, 50, 236, 63, 77, 85, 139, 204, 304, 446, 474, 461, 467, 560, 364, 524, 549, 479, 563, 566, 563, 537, 418, 241, 57, 99, 389, 254, 478, 424, 473, 142, 237, 166, 196, 315, 354, 411, 343, 174, 81, 58, 269, 328, 581, 606, 485, 516, 119, 403, 253, 560, 356, 524, 452, 82, 5, 7, 24, 62, 446, 604, 574, 494, 384, 533, 522, 554, 579, 400, 570, 531, 243,
+#> 343, 242, 611, 610, 606, 621, 378, 550, 582, 588, 583, 495, 618, 603, 594, 558, 576, 551, 610, 433, 436, 230, 336, 160, 7, 85, 525, 609, 639, 577, 394, 608, 633, 533, 529, 496, 621, 591, 416, 529, 563, 542, 461, 292, 226, 58, 61, 430, 551, 499, 574, 513, 357, 553, 420, 564, 497, 492, 449, 404, 549, 96, 292, 431, 286, 11, 482, 405, 76, 545, 510, 255, 581, 546, 520, 96, 60, 87, 31, 0, 44, 29, 45, 47, 96, 0, NA, NA, NA, NA, NA, NA, 70, 51, 83, 69, 61, 63, 59, 65, 70, NA, NA, NA, NA, NA, 384, 580, 540,
+#> 663, 626, 627, 644, 430, 45, 119, 4, 271, 206, 3, 14, 284, 510, 594, 619, 599, 581, 546, 516, 516, 448, 495, 380, 539, 600, 497, 528, 127, 177, 107, 44, 73, 86, 77, 83, 87, 73, 79, 82, 25, NA, 7, 29, 59, 70, 60, 19, 73, 61, 26, 2, 213, 621, 647, 672, 504, 333, 563, 460, 493, 546, 510, 510, 362, 506, 505, 219, 57, 117, 496, 602, 562, 477, 379, 431, 489, 227, 160, 146, 417, 9, 0, 0, 0, 0, 0, 0, NA, NA, 0, 0, NA, NA, NA, 0, 33, 98, 441, 280, 108, 269, 189, 475, 427, 412, 316, 409, 262, 123, 45, 34,
+#> 188, 374, 560, 542, 610, 595, 376, 579, 320, 218, 550, 593, 551, 587, 348, 215, 130, 42, 535, 530, 618, 427, 502, 587, 582, 553, 214, 450, 494, 17, 230, 275, 157, 98, 43, 33, 305, 508, 570, 548, 311, 76, 169, 337, 271, 38, 0, 10, 8, 57, 77, 95, 79, 92, 93, 82, 104, 99, 94, 109, 120, 123, 90, 52, 87, 65, NA, NA, NA, 1, NA, NA, 32, 484, 423, 477, 335, 560, 643, 558, 609, 584, 604, 403, 509, 472, 470, 453, 383, 322, 249, 323, 487, 463, 300, 499, 386, 113, 483, 517, 206, 513, 292, 410, 554, 546, 591,
+#> 549, 569, 599, 239, 585, 561, 574, 589, 623, 642, 246, 86, 340, 161, 219, 115, 72, 45, 344, 558, 638, 605, 502, 577, 611, 377, 635, 578, 624, 466, 522, 635, 621, 614, 587, 503, 557, 454, 17, 102, 413, 592, 527, 437, 385, 563, 492, 203, 442, 232, 419, 496, 455, 334, 481, 257, NA, NA, NA, NA, NA, 0, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 0, NA, 8, 20, 13, 12, 9, 9, 8, 7, 10, 4, 1, 1, 42, 17, 101, 414, 305, 451, 643, 407, 590, 622, 416, 654, 661, 603, 631, 542, 250, 466, 631, 423, 553, 604, 479,
+#> 556, 670, 490, 360, 537, 618, 553, 247, 313, 568, 522, 54, 269, 82, 54, 429, 513, 400, 442, 473, 411, 214, 470, 39, 317, 256, 116, 12, 33, 545, 582, 504, 552, 431, 531, 349, 549, 320, 121, 401, 451, 152, 214, 164, 39, 141, 498, 509, 492, 615, 587, 597, 558, 388, 539, 598, 567, 633, 565, 575, 559, 414, 61, 568, 583, 547, 294, 115, 17, 2, 320, 405, 489, 524, 595, 561, 591, 628, 340, 377, 608, 534, 493, 477, 585, 339, 49, 264, 35, 303, 372, 85, 183, 433, 508, 515, 226, 589, 508, 587, 461, 401, 85, NA,
+#> NA, NA, NA, 1, 0, NA, NA, NA, 7, NA, NA, 1, NA, NA, 393, 546, 381, 410, 563, 27, 4, 41, 4, 624, 653, 388, 539, 528, 419, 614, 594, 494, 316, 506, 461, 350, 150, 95, 1, 0, 85, 27, 11, NA, NA, 56, NA, 43, 53, 81, 75, 70, 5, 32, NA, NA, 23, 70, 56, 350, 432, 409, 389, 425, 520, 533, 418, 174, 373, 443, 422, 240, 155, 130, 198, 298, 507, 560, 511, 586, 544, 536, 502, 570, 583, 363, 561, 507, 363, 250, 384, 129, 584, 586, 621, 486, 167, 13, 486, 451, 135, 209, 388, 459, 309, 115, 472, 305, 350, 502, 474,
+#> 36, 24, 211, 168, 395, 532, 255, 353, 535, 248, 549, 592, 561, 6, 122, 492, 515, 695, 676, 434, 645, 405, 152, 355, 70, 66, 359, 46, 60, 5, 51, 66, 30, 12, 3, 5, 14, 27, 50, 65, 83, 80, 51, 89, 85, 83, 68, NA, NA, NA, NA, NA, 23, 17, 4, 24, 13, 18, 20, 24, 14, 13, 7, 10, 4, 6, 8, 1, 2, 3, 3, 34, 34, 0, 58, 72, 21, NA, NA, NA, 0, NA, 52, 388, 573, 390, 543, 471, 559, 523, 329, 219, 144, 156, 6, 34, 198, 588, 705, 439, 585, 576, 541, 605, 631, 610, 591, 383, 307, 294, 396, 221, 21, 0, NA, 1, 0, NA,
+#> NA, NA, 0, NA, 0, 43, 448, 460, 560, 392, 489, 505, 555, 605, 574, 597, 466, 449, 559, 375, 102, 401, 292, 223, 193, 127, 219, 32, 282, 532, 555, 443, 325, 193, 270, 452, 366, 51, 6, 27, 503, 311, 522, 533, 505, 549, 374, 557, 541, 596, 555, 490, 523, 455, 153, 244, 248, 285, 590, 587, 609, 450, 488, 552, 412, 537, 514, 600, 575, 593, 512, 550, 518, 545, 381, 156, 227, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 1, 4, 1, 453, 138, 56, 11, 1, 7, 8, 0, NA, NA, NA, NA, 0, NA, NA, NA, 46, 288, 493, 553,
+#> 348, 486, 605, 578, 549, 327, 466, 424, 433, 470, 402, 83, 192, 20, 126, 178, 38, 253, 147, 252, 332, 305, 450, 469, 514, 592, 400, 602, 411, 461, 341, 346, 114, 121, 440, 495, 561, 551, 541, 111, 382, 493, 572, 394, 515, 529, 441, 41, 256, 283, 162, 127, 29, 78, 62, 72, 83, 73, 78, 41, 73, 54, 16, 45, 76, 57, 7, 25, 24, 12, 16, 100, 282, 469, 519, 234, 300, 246, 120, 282, 216, 284, 264, 296, 139, 227, 63, 8, 2, 0, NA, NA, NA, NA, NA, 31, 45, 77, 28, 18, NA, 10, 45, 46, 16, 4, 5, 5, 22, 5, 11, 0,
+#> 15, 2, 37, 507, 577, 566, 502, 564, 555, 487, 551, 312, 556, 581, 505, 500, 256, 104, 1, 64, 95, 91, 79, 97, 109, 92, 44, 66, 69, NA, NA, 12, 32, 63, 17, 5, 65, 3, 150, 295, 343, 294, 195, 153, 82, 0, 351, 591, 423, 536, 513, 502, 547, 608, 358, 554, 235, 306, 489, 470, 396, 318, 163, 296, 407, 465, 115, 288, 542, 438, 96, 324, 379, 179, 72, 7, 72, 70, 50, 3, 70, 62, 67, 67, 75, 64, 42, 35, 50, 14, NA, NA, NA, NA, NA, NA, NA, NA, 0, NA, 0, NA, 3, 7, 1, NA, NA, NA, 453, 654, 602, 399, 482, 299, 597,
+#> 401, 591, 554, 556, 551, 507, 16, 496, 6, 363, 239, 278, 628, 440, 536, 574, 639, 385, 425, 81, 368, 202, NA, NA, 0, 0, NA, NA, 0, NA, 0, NA, 1, 0, NA, NA, NA, NA, NA, NA, 8, 62, 183, 347, 575, 584, 535, 487, 61, 545, 215, 149, 570, 498, 427, 146, 106, 134, 316, 452, 359, 387, 228, 310, 227, 86, 196, 335, 197, 121, 130, NA, NA, NA, 58, 79, 71, NA, NA, NA, NA, NA, 65, 76, 530, 384, 569, 369, 598, 589, 607, 616, 614, 566, 592, 574, 349, 214, 544, 62, 42, 39, 598, 663, 641, 642, 627, 624, 575, 646,
+#> 600, 650, 637, 641, 444, 550, 640, 615, 601, 332, 309, 477, 119, 638, 623, 569, 488, 633, 610, 632, 651, 615, 652, 567, 119, 24, 41, 38, 543, 250, 597, 525, 633, 600, 424, 60, 203, 18, 1, 167, 440, 522, 511, 422, 489, 346, 575, 370, 547, 427, 512, 453, 9, 303, 328, 539, 337, 473, 542, 484, 439, 73, 51, 18, 85, 49, 57, 12, 85, 13, 31, 21, 6, 7, 11, 52, 81, 63, 40, NA, 18, 2, 23, 15, 0, 3, NA, NA, NA, NA, NA, NA, NA, NA, NA, 155, 46, 240, 227, 452, 557, 628, 363, 567, 371, 164, 108, 484, 145, 170,
+#> 0, 1, 0, 0, NA, NA, NA, 0, 0, 0, NA, NA, NA, NA, NA, 1, 4, 30, 298, 176, 592, 492, 504, 448, 96, 508, 167, 114, 482, 466, 353, 158, 24, 199, 59, 41, 79, 77, 74, 96, 71, 77, 81, 55, 85, 82, 49, 14, NA, NA, NA, 0, 0, 0, NA, 0, NA, NA, NA, NA, NA, NA, NA, 6, 7, 13, 40, 11, 109, 145, 174, 42, 270, 441, 368, 362, 251, 344, 347, 330, 362, 327, 141, 167, 151, 128, 147, 9, NA, 0, NA, NA, 0, 0, 64, 46, 0, 44, 67, 51, 73, 70, NA, NA, NA, 6, 77, 47, 81, 54, 6, 635, 633, 636, 609, 627, 523, 618, 606, 615, 585,
+#> 612, 456, 223, 554, 447, 21, 210, 497, 542, 546, 546, 510, 384, 505, 424, 491, 464, 410, 304, 112, 263, 174, 67, 19, 422, 601, 571, 612, 497, 620, 562, 199, 113, 501, 497, 474, 475, 156, 200, 309, 300, 269, 271, 11, 92, 65, 551, 618, 386, 609, 507, 278, 93, 271, 486, 563, 299, 0, 0, 5, 16, 34, 7, 5, NA, 0, 5, NA, NA, 29, 520, 466, 379, 296, 80, 159, 225, 169, 61, 277, 47, 420, 522, 393, 475, 532, 543, 476, 542, 505, 156, 100, 92, 87, 202, 29, 295, 49, 338, 582, 625, 653, 580, 551, 584, 621, 619,
+#> 546, 514, 560, 366, 460, 501, 353, 435, 292, 389, 378, 487, 539, 592, 584, 589, 592, 472, 502, 431, 260, 102, 647, 576, 555, 594, 579, 127, 472, 602, 530, 404, 29, 109, 248, 382, 562, 549, 530, 532, 432, 512, 265, 355, 303, 171, 17, 292, 332, 406, 161, 315, 439, 579, 565, 558, 612, 409, 570, 594, 600, 544, 479, 365, 80, 56, 267, 95, 496, 619, 17, 251, 278, 66, 258, 435, 552, 539, 275, 245, 163, 325, 431, 361, 532, 517, 397, 439, 408, 443, 294, 131, 32, 24, 51, 10, 6, 32, 79, 74, 40, 29, 5, 37, NA,
+#> 27, NA, 0, 20, 313, 647, 615, 622, 575, 580, 530, 429, 517, 457, 609, 551, 415, 384, 502, 201, 271, 321, 135, 11, 78, 89, 0, 9, 16, 9, 13, 6, 5, 2, NA, NA, NA, 2, 0, 0, NA, 2, NA, NA, NA, 0, 0, 38, 175, 290, 266, 401, 531, 581, 441, 487, 542, 253, 315, 462, 56, 403, 330, 227, 16, 1, 8, 19, 0, 3, 2, 13, 0, 1, 0, 0, NA, NA, 7, 4, 370, 221, 536, 469, 324, 199, 166, 187, 57, 53, 23, 57, 29, 4, 19, 95, 73, 84, 94, NA, NA, 19, 567, 578, 479, 580, 478, 498, 494, 462, 104, 70, 93, 81, 64, 90, 40, 75, 63,
+#> 72, 70, 12, NA, 4, 2, 2, 1, 2, 0, 190, 304, 606, 622, 642, 589, 521, 604, 573, 530, 520, 489, 419, 535, 451, 592, 461, 411, 127, 102, 2, 28, 65, 78, 52, 1, 40, 48, 83, 86, 84, 74, 90, NA, 1, 29, 12, 279, 603, 652, 677, 569, 599, 631, 394, 587, 640, 530, 372, 458, 37, 58, 34, NA, 24, 0, NA, NA, 5, 0, NA, NA, NA, NA, 0, NA, NA, 28, 45, 58, 14, 35, 1, 5, 4, 0, 5, 85, 397, 443, 539, 394, 458, 444, 423, 282, 129, 30, 11, 212, 596, 581, 582, 569, 480, 593, 592, 573, 626, 577, 537, 477, 414, 327, 190, 162,
+#> 0, 8, 4, 1, 10, 8, 9, 7, 8, 0, NA, 0, NA, 0, 0, NA, 2, NA, 491, 547, 560, 566, 597, 516, 524, 40, 457, 365, 415, 499, 490, 264, 16, 232, 107, 636, 600, 623, 616, 563, 497, 278, 229, 373, 438, 293, 162, 84, 14, 163, 112, 606, 607, 641, 610, 614, 613, 562, 558, 627, 410, 81, 358, 457, 586, 561, 605, 306, 430, 588, 542, 568, 357, 306, 168, 61, 491, 280, 608, 596, 569, 640, 570, 505, 599, 333, 172, 94, 321, 488, 478, 416, 326, 385, 495, 134, 318, 293, 345, 85, 222, 61, 84, 67, 322, 641, 526, 603, 569,
+#> 545, 289, 133, 10, 222, 411, 493, 313, 558, 596, 559, 510, 304, 50, 561, 100, 447, 155, 60, NA, NA, NA, NA, NA, 76, 94, 72, 35, 13, 46, 2, 46, 18, 44, 475, 534, 625, 559, 612, 336, 159, 16, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 1, 2, 4, 4, 3, 2, 3, 1, 72, 58, 27, 2, 12, 9, 41, 48, 48, 47, 72, 95, 80, 71, 75, 54, 1, 26, 508, 584, 588, 560, 596, 584, 468, 498, 577, 586, 456, 50, 281, 327, 514, 522, 502, 128, 306, 280, 10, 95, 394, 388, 320, 539, 589, 590, 468, 441, 80, 476, 284, 95, 557,
+#> 691, 680, 624, 657, 635, 551, 611, 639, 622, 439, 538, 34, 233, 564, 687, 578, 648, 573, 635, 558, 622, 173, 353, 366, 384, 409, 486, 485, 64, 59, 180, 418, 510, 523, 482, 528, 428, 8, 249, 231, 28, NA, NA, 0, 0, NA, NA, NA, NA, NA, NA, NA, NA, 1, 7, 10, 6, 1, 0, 0, 0, 2, 0, 0, 96, 600, 630, 610, 227, 481, 572, 366, 73, 231, 429, 396, 360, 388, 583, 430, 111, 218, 256, 61, 350, 574, 578, 561, 581, 327, 176, 398, 113, 40, 183, 384, 540, 233, 300, 439, 500, 562, 293, 214, 12, 24, 205, 289, 204, 449,
+#> 498, 462, 151, 299, 260, 15, 104, 94, 105, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 0, 0, 23, 85, 71, NA, NA, NA, 6, NA, 2, 26, 19, 17, 64, 5, 4, 2, 0, 6, 4, NA, 2, 2, 0, NA, NA, NA, NA, NA, 64, NA, NA, NA, 2, NA, NA, NA, NA, NA, 24, 2, 262, 559, 578, 583, 391, 613, 447, 586, 640, 633, 309, 513, 162, 406, 113, 237, 7, 34, 303, 340, 352, 190, 279, 336, 293, 97, 5, 139, 98, 174, 122, 415, 474, 472, 462, 453, 285, 267, 75, 376, 120, 415, 158, 452, 191, 254, 156, 521, 584, 450, 251,
+#> 666, 608, 46, 576, 437, 465, 609, 615, 418, 665, 609, 636, 454, 525, 660, 538, 502, 10, 26, 411, 216, 18, 127, 278, 516, 514, 507, 341, 503, 374, 160, 566, 478, 53, 557, 550, 490, 523, 483, 467, 84, 135, 317, 423, 366, 174, 509, 521, 236, 299, 62, 546, 492, 462, 344, 580, 386, 469, 337, 266, 481, 341, 29, 350, 252, 477, 478, 401, 175, 23, 53, 24, 461, 382, 268, 111, 240, 456, 384, 217, 79, 49, 11, 65, 701, 663, 591, 655, 629, 333, 199, 492, 594, 102, 122, 261, 136, 171, 34, 188, 95, 50, NA, 0, NA,
+#> NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 2, NA, 9, 37, 59, 76, 42, 28, 4, 40, 28, 71, 49, 25, 57, NA, 26, NA, NA, 0, NA, NA, NA, NA, NA, NA, NA, 55, 56, 69, 0, NA, 0, 0, 0, NA, 0, 0, 0, 1, 0, NA, 15, 391, 351, 454, 379, 456, 438, 389, 369, 406, 514, 447, 422, 338, 0, 50, 76, 71, 90, 85, 77, 7, 31, 68, 73, 44, NA, NA, 3, 66, 62, 7, 59, 10, 104, 445, 530, 598, 613, 642, 631, 458, 485, 207, 7, 51, 639, 455, 636, 443, 642, 641, 598, 403, 427, 552, 265, 563, 474, 158, 390, 309, 361, 424, 418, 564, 587,
+#> 476, 493, 491, 614, 323, 374, 63, 214, 8, 3, 303, 354, 549, 549, 553, 526, 523, 237, 150, 305, 154, 3, 6, 4, 2, 1, 3, 5, 1, 1, 1, 3, 0, 1, 0, 2, 0, 1, 0, 0, 0, 0, 26, 452, 236, 445, 133, 316, 500, 423, 427, 517, 393, 347, 279, 192, 538, 304, 567, 582, 344, 552, 258, 71, 13, 125, 29, 560, 658, 636, 599, 495, 613, 548, 582, 589, 107, 532, 433, 432, 289, 141, 1, 90, 338, 197, 320, 233, 165, 40, 50, 31, 35, 412, 590, 578, 610, 544, 180, 540, 327, 481, 295, 75, 321, 551, 609, 572, 579, 375, 325, 470,
+#> 417, 554, 626, 600, 555, 494, 156, 243, 292, 272, 10, 234, 192, 466, 584, 616, 625, 577, 438, 502, 403, 237, 317, 595, 562, 97, 236, 119, 239, 174, 1, 3, 10, NA, NA, 23, 67, 26, 33, 0, NA, NA, NA, 0, NA, 159, 439, 588, 325, 614, 464, 533, 384, 427, 496, 517, 224, 538, 583, 396, 156, 507, 241, 346, 18, 41, 4, 295, 195, 284, 344, 315, 412, 395, 446, 398, 385, 180, 62, 0, 5, 39, 7, NA, NA, 0, NA, NA, 0, NA, 0, NA, 0, NA, NA, NA, NA, NA, 408, 529, 575, 588, 600, 565, 513, 491, 389, 454, 436, 393, 554,
+#> 251, 256, 171, NA, NA, NA, NA, NA, 90, 36, 37, 23, 36, 24, 65, 57, 31, 9, 13, 7, 140, 525, 564, 560, 590, 552, 545, 521, 522, 373, 351, 180, 82, 396, 439, 515, 405, 71, 284, 201, 2, 11, 30, 46, 12, 8, 7, 23, 10, 13, NA, NA, 1, NA, 3, 1, 0, NA, 10, 67, 76, 81, 65, 82, 73, 31, 6, 34, NA, 0, 0, 1, 0, 23, 61, 41, 69, 50, 18, 38, 10, 3, 14, 328, 196, 268, 505, 543, 524, 371, 360, 323, 310, 92, 114, 59, 127, 21, 57, NA, NA, NA, 1, NA, NA, 0, NA, 0, NA, NA, NA, NA, NA, NA, 0, NA, 0, 0, 1, 1, NA, 0, NA,
+#> 0, 0, NA, 2, 0, 0, 0, 475, 392, 270, 55, 2, 68, 162, 47, 68, 34, 5, 295, 536, 551, 557, 528, 531, 255, 302, 424, 528, 617, 564, 564, 529, 566, 170, 343, 523, 297, 72, 76, 211, 211, 211, 283, 411, 444, 501, 525, 522, 339, 429, 491, 44, 382, 643, 615, 634, 608, 661, 101, 500, 630, 426, 215, 264, 158, 360, 90, 48, 74, 60, 344, 419, 174, 133, 307, 170, 28, 155, 66, 355, 389, 220, 554, 495, 571, 590, 564, 350, 235, 227, 169, 123, 443, 555, 546, 613, 610, 437, 553, 605, 619, 646, 639, 377, 617, 577, 628,
+#> 633, 590, 548, 517, 0, NA, 0, NA, NA, NA, NA, NA, NA, NA, NA, 6, 4, 4, 7, 0, 4, 28, 250, 581, 346, 575, 471, 545, 492, 73, 10, 331, 477, 287, 419, 71, 156, 51, 93, 150, 216, 186, 147, 9, 163, 419, 564, 530, 395, 86, 504, 442, 315, 94, 508, 164, 134, 12, 29, 19, 70, 45, 85, 73, 51, 50, 76, 83, NA, NA, NA, 0, NA, NA, 1, NA, 59, 76, 77, 84, 84, 89, 71, 58, 60, 56, 1, 1, 16, 13, 143, 341, 569, 545, 592, 429, 446, 65, 1, 19, 445, 184, 299, 215, 292, 203, 418, 451, 409, 137, 356, 220, 167, 116, 194, 146,
+#> 128, 46, 62, 22, 558, 540, 399, 588, 474, 235, 499, 149, 278, 613, 424, 357, 147, 390, 393, 439, 518, 198, 33, 455, 597, 548, 565, 582, 433, 260, 545, 608, 633, 606, 520, 364, 197, 166, 300, 491, 428, 528, 131, 359, 387, 98, 413, 551, 538, 580, 519, 510, 473, 539, 391, 506, 517, 532, 552, 355, 480, 476, 403, 390, 373, 42, 367, 340, 12, 42, 96, 81, 83, 88, 88, 91, 63, 72, 68, 67, 75, 64, 80, 64, 59, 68, 69, 76, 43, 25, 62, 13, 42, 11, 49, 53, 95, 522, 516, 462, 36, 389, 265, 372, 277, 61, 2, 8, 7,
+#> 2, 5, 1, NA, NA, 0, 0, 7, 4, 5, 4, 29, 7, 2, 1, 0, 0, 0, 0, 1, NA, 0, NA, NA, NA, NA, NA, NA, 1, NA, 51, 439, 396, 484, 585, 352, 411, 140, 495, 540, 429, 249, 275, 381, 398, 74, 83, 175, 174, 573, 624, 594, 573, 425, 494, 391, 200, 361, 381, 35, 245, 156, 292, 617, 589, 529, 579, 445, 283, 404, 596, 510, 627, 371, 408, 215, 134, 134, 290, 365, 35, 341, 429, 374, 461, 408, 408, 435, 345, 348, NA, NA, NA, NA, 37, 38, 62, 67, 72, 82, 49, 22, 0, 16, 16, 60, 67, 62, 74, 77, 81, 56, 63, 76, 63, 71, 65,
+#> 68, 57, 68, 53, 54, 64, 53, 56, 19, 545, 623, 586, 637, 571, 589, 392, 517, 588, 412, 588, 563, 610, 575, 590, 253, 263, 110, 61, 45, 493, 606, 592, 554, 401, 492, 586, 183, 590, 588, 469, 456, 465, 109, 283, 152, 48, 195, 80, 220, 459, 485, 330, 243, 219, 407, 50, 160, NA, 0, NA, 0, NA, NA, NA, NA, NA, NA, 0, 67, 532, 515, 559, 593, 550, 477, 510, 375, 492, 462, 394, 392, 274, 30, 79, 76, 75, 49, 53, 46, 1, 1, 26, 1, NA, 0, NA, NA, 0, NA, 0, 0, 0, 565, 600, 602, 445, 538, 578, 611, 603, 603, 400,
+#> 521, 300, 554, 586, 535, 400, 448, 568, 566, 540, 562, 590, 600, 571, 605, 572, 100, 191, 559, 573, 549, 399, 493, 527, 530, 585, 486, 582, 68, 523, 546, 240, 105, 466, 531, 186, 60, 51, 244, 489, 663, 588, 621, 651, 634, 638, 622, 603, 435, 558, 625, 612, 283, 105, 83, 563, 260, 575, 561, 544, 606, 410, 419, 502, 383, 516, 82, 343, 171, 81, 309, 41, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 21, 280, 420, 473, 363, 492, 639, 597, 579, 600, 363, 442, 408, 511, 527, 504, 547, 502, 302, 96, 327, 98, 398,
+#> 124, 486, 510, 589, 619, 603, 594, 403, 552, 547, 555, 595, 593, 510, 476, 298, 135, 143, 611, 578, 514, 502, 468, 431, 290, 43, 97, 47, 419, 487, 528, 490, 395, 494, 272, 568, 454, 438, 314, 497, 477, 454, 108, 150, 315, 17, 62, 74, 65, 75, 71, 37, 56, 78, 79, 51, 62, 7, 2, 1, 2, 68, 64, 54, 8, 2, 13, 579, 356, 54, 334, 317, 132, 14, 545, 619, 406, 551, 608, 628, 507, 578, 584, 438, 524, 336, 103, 43, 32, 171, 487, 544, 528, 135, 326, 511, 499, 542, 556, 502, 556, 470, 328, 497, 486, 60, 90, 545,
+#> 584, 536, 422, 352, 541, 533, 606, 562, 461, 532, 277, 327, 127, 1, 232, 557, 659, 607, 464, 567, 616, 595, 557, 322, 574, 334, 397, 80, 368, 487, 175, 557, 236, 258, 322, 213, 519, 444, 136, 301, 549, 501, 515, 492, 576, 573, 584, 151, 494, 418, 268, 3, 103, 138, 129, 144, 368, 459, 285, 485, 510, 257, 342, 12, 126, 269, NA, NA, NA, NA, NA, NA, 54, 43, 391, 367, 608, 653, 527, 301, 55, 333, 323, 72, 13, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 0, NA, NA, NA, 4, 0, 1, NA, 0, NA,
+#> 0, NA, 2, 0, 0, 154, 241, 346, 291, 480, 488, 295, 35, 143, 57, 94, 69, 159, 160, 20, 14, 6, 4, 14, 42, 53, 117, 74, 576, 569, 459, 481, 662, 493, 600, 465, 543, 517, 352, 180, 208, 339, 276, 367, 469, 173, 317, 387, 255, 426, 483, 560, 286, 542, 542, 565, 576, 574, 613, 611, 582, 250, 567, 568, 579, 513, 266, 177, 344, 167, 153, 549, 420, 477, 547, 498, 492, 443, 494, 129, 336, 227, 7, 116, 200, 13, 178, 349, 432, 316, 379, 82, 145, 337, 291, 137, 74, 288, 558, 653, 630, 475, 551, 671, 558, 542,
+#> 603, 595, 448, 343, 587, 562, 137, 14, 125, 211, 271, 583, 608, 632, 604, 424, 530, 527, 573, 549, 589, 565, 428, 49, 116, 8, 358, 454, 458, 551, 384, 492, 398, 524, 557, 581, 565, 572, 553, 539, 164, 261, 173, NA, NA, NA, 3, 64, 75, 28, 40, 63, 81, 76, 50, 31, 30, 83, 86, 52, 7, 0, 2, 2, 2, 0, 0, NA, NA, NA, NA, NA, 0, 0, 0, 0, 0, 79, 515, 373, 537, 581, 582, 463, 353, 568, 475, 483, 528, 186, 211, 69, 547, 405, 434, 547, 556, 18, 149, 394, 534, 482, 503, 478, 234, 455, 398, 399, 309, 312, 593,
+#> 657, 624, 442, 557, 424, 83, 467, 511, 57, 80, 182, 207, 85, 158, 30, 216, 249, 122, 189, 181, 173, 423, 290, 399, 397, 260, 87, 156, 341, 427, 185, 97, 218, 23, 461, 585, 594, 412, 546, 602, 634, 609, 610, 559, 236, 431, 431, 429, 159, 352, 590, 246, 345, 637, 315, 254, 134, NA, 31, 80, 77, 70, 72, 65, NA, NA, NA, NA, NA, NA, 3, 3, 3, 3, 1, 4, 35, 222, 320, 522, 451, 163, 309, 337, 77, 77, 585, 470, 270, 164, 79, 2, 2, 4, 3, 3, 3, 0, 1, 0, 0, 0, 1, 0, 0, 49, 312, 208, 239, 318, 146, 86, 434, 536,
+#> 634, 616, 580, 601, 388, 572, 270, 299, 162, 361, 34, 99, 142, 15, 5, 341, 482, 422, 344, 540, 538, 584, 454, 513, 484, 565, 601, 427, 345, 328, 49, NA, NA, NA, NA, 34, 66, 46, 28, 65, 48, 29, 29, 48, 4, 50, 3, 126, 475, 415, 514, 198, 570, 341, 194, 148, 348, 268, 18, 143, 436, 66, 51, 20, 91, 595, 451, 483, 597, 405, 309, 444, 409, 524, 451, 493, 84, 521, 335, 389, 100, 215, 41, 9, 7, NA, NA, NA, NA, 0, NA, NA, NA, NA, 32, 7, 97, 83, 80, 89, 36, 80, 8, 6, 15, 50, 26, 14, 419, 223, 544, 575, 531,
+#> 435, 570, 536, 285, 422, 330, 346, 367, 44, 0, 203, 83, 585, 541, 574, 506, 543, 406, 526, 546, 486, 452, 273, 208, 171, 185, 11, 315, 386, 416, 113, 346, 426, 286, 135, 451, 244, 356, 305, 46, 217, 464, 596, 607, 545, 373, 562, 655, 560, 619, 590, 539, 495, 505, 516, 404, 224, 406, 426, 94, 219, 355, 539, 394, 550, 635, 527, 609, 524, 614, 487, 79, NA, NA, 0, NA, NA, NA, NA, 0, NA, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 1, 0, 0, NA, NA, NA, NA, 0, 0, NA, 0, NA, NA, NA, 0, NA, 1, 512, 569, 378, 438, 425,
+#> 200, 409, 458, 30, 66, 75, 69, 20, 30, 56, 6, 5, 63, 65, 26, 4, 0, 53, 290, 484, 550, 561, 571, 522, 439, 529, 436, 569, 568, 554, 449, 483, 365, 187, 352, 69, 196, 17, 185, 468, 301, 520, 527, 575, 588, 450, 35, 60, 208, 5, 16, 337, 130, 527, 629, 612, 645, 615, 331, 445, 93, 543, 542, 583, 494, 21, 254, 46, 138, 349, 445, 387, 538, 484, 579, 633, 561, 662, 593, 114, 461, 391, 99, 84, 532, 316, 262, 598, 426, 564, 498, 642, 643, 625, 604, 577, 556, 517, 478, 380, 412, 98, 117, 154, 321, 452, 505,
+#> 496, 440, 494, 557, 526, 480, 578, 508, 193, 490, 432, 503, 345, 17, 276, 71, 206, 101, 62, 61, 289, 558, 431, 502, 599, 204, 525, 500, 476, 447, 498, 467, 350, 365, 250, 90, 29, 217, NA, NA, NA, NA, NA, NA, 4, 2, 11, 6, 7, 5, 2, 1, 3, 4, 2, 5, 22, 42, 32, 23, 59, 19, 24, NA, 19, 25, 4, 0, 40, 385, 496, 400, 484, 287, 312, 481, 478, 340, 441, 505, 453, 446, 295, 325, 73, 320, 261, 567, 408, 563, 551, 509, 499, 591, 537, 540, 612, 445, 561, 485, 420, 126, 240, 549, 602, 591, 587, 522, 568, 594, 622,
+#> 615, 553, 607, 417, 146, 367, 131, 343, NA, NA, NA, NA, NA, NA, 7, 5, 6, 60, 0, 0, 5, 1, 22, 69, 192, 204, 163, 406, 543, 563, 358, 470, 564, 540, 244, 266, 364, 45, 16, 16, 277, 333, 489, 414, 489, 246, 481, 438, 347, 457, 579, 395, 279, 63, 21, 7, 0, 5, 4, 4, NA, 0, 1, 0, 0, 0, 2, 12, 7, 3, 9, 28, 3, 3, 1, 0, 0, 0, 0, 0, 48, 582, 654, 626, 627, 593, 614, 644, 482, 643, 654, 623, 639, 596, 634, 663, 546, 683, 63, 581, 103, 478, 296, 175, 261, 167, 261, 117, 298, 132, 228, 148, 35, 268, 68, 156,
+#> 54, 142, 601, 587, 686, 502, 554, 632, 624, 607, 601, 605, 572, 583, 510, 444, 522, 373, 463, 156, 523, 132, 490, 228, 366, 568, 468, 154, 452, 456, 607, 603, 496, 404, 71, 344, 142, 128, 10, NA, NA, NA, 4, 5, 5, 4, 3, 7, 23, 62, 62, 4, 2, 5, 4, 4, 2, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 70, 48, 57, 57, 58, 62, 53, 53, 54, 18, 0, 2, 5, 3, 2, 8, 3, 3, 3, 0, 4, 0, 0, 0, 0, 0, 0, 0, 0, 1, 2, 4, 44, 63, 64, 69, 7, 2, 0, 0, 5, 3, 2, 69, 38, 9, 39, 14, 73, 221, 580, 559, 598, 631, 608, 597, 436, 554,
+#> 626, 614, 619, 565, 565, 600, 546, 561, 550, 369, 502, 356, 505, 520, 133, 461, 460, 117, 61, 1, 29, 82, 45, 18, 89, 81, 64, 74, 81, 82, 23, 45, 75, 17, 2, 40, 14, 61, 46, 1, 3, NA, NA, NA, 15, 7, NA, 6, 5, 3, 2, 0, 0, 0, 0, 87, 684, 604, 532, 529, 83, 635, 658, 156, 165, 230, 469, 431, 163, 160, 130, 561, 601, 421, 483, 554, 375, 205, 559, 500, 196, 521, 392, 408, 137, 338, 471, 252, 294, 68, 112, 460, 408, 329, 519, 595, 594, 531, 589, 569, 589, 511, 476, 458, 303, 165, 67, 456, 386, 352, 343,
+#> 597, 380, 431, 265, 519, 361, 200, NA, 11, 14, 42, 74, 14, 55, 72, 63, 37, 37, 0, 56, 45, 11, NA, NA, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 1, 1, 0, 0, 0, NA, NA, NA, NA, NA, NA, NA, NA, 28, NA, NA, NA, 4, 6, 6, 2, 4, 6, 57, 7, 0, 5, 15, 38, 68, 87, 213, 324, 389, 428, 479, 530, 473, 470, 428, 129, 271, 381, 513, 520, 443, 583, 608, 463, 623, 608, 622, 593, 53, 273, 106, 399, 582, 592, 656, 625, 560, 595, 570, 586, 565, 572, 209, 281, 278, 190, 233, NA, NA, NA, NA, NA, 50, 50, 61, 22, 0, 8, 0, 0, 12,
+#> 7, NA, NA, 0, 0, NA, NA, NA, 0, NA, 0, 0, 0, 0, 0, 1, 0, 1, 0, 0, 0, 0, 0, 93, 583, 486, 594, 542, 482, 165, 16, 234, 20, 54, 40, 48, 72, 61, 45, 18, 6, 1, 0, 0, 0, 0, 0, 1, 151, 230, 316, 357, 45, 67, 527, 594, 549, 464, 585, 304, 107, 223, 267, 189, 193, 316, 19, 268, 541, 519, 342, 119, 582, 187, 355, 572, 560, 524, 216, 12, 86, 113, 382, 542, 501, 569, 370, 392, 375, 141, 361, 573, 550, 461, 485, 251, 37, NA, NA, NA, 1, NA, NA, 0, NA, NA, 75, 72, 82, 78, 66, 36, 20, 63, 0, 2, 7, 3, 9, 0, 0, 0,
+#> 3, 11, 35, 48, 6, 33, 379, 422, 429, 630, 614, 610, 619, 582, 611, 590, 581, 417, 113, 446, 397, 133, 585, 518, 428, 421, 107, 244, 79, 47, 166, 455, 313, 510, 389, 121, 476, 508, 476, 392, 209, 77, 10, 302, 594, 480, 533, 425, 573, 571, 529, 184, 213, 453, 199, 3, 524, 598, 597, 601, 567, 579, 572, 548, 555, 472, 358, 411, 513, 439, 488, 317, 455, 387, 13, 156, 191, 149, 309, 22, 10, 117, 350, 170, 38, 0, 5, 1, 3, 0, 2, 0, 2, 2, 2, 3, 0, 0, 0, 0, 0, 0, 58, 663, 372, 617, 637, 521, 333, 266, 582,
+#> 510, 554, 606, 308, 220, 353, 167, 547, 554, 403, 478, 7, 16, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 130, 91, 488, 519, 530, 573, 569, 574, 505, 570, 458, 521, 524, 538, 598, 94, 335, 368, 518, 557, 628, 544, 457, 490, 514, 519, 368, 50, 37, 27, 325, 623, 610, 571, 599, 614, 394, 612, 520, 607, 574, 541, 383, 593, 562, 0, 1, 48, 42, 73, 61, 74, 73, 79, 64, 60, 64, 25, 24, 37, 0, 22, 61, 60, NA, NA, 8, NA, NA, NA, NA, NA, 3, 2, 2, 2, 1, 5, 5, 2, 1, 18, 3, 73, 51, 42, 26, 13, NA, NA, NA, 3, 79, 75, 60, 1, 16,
+#> 0, 2, 48, 3, 5, 6, 29, 5, 6, 5, 1, 0, 1, 0, 0, 0, 0, 0, 0, NA, NA, NA, NA, NA, NA, NA, 1, 66, 55, 53, NA, 32, 31, 4, 292, 263, 214, 608, 601, 367, 232, 488, 221, 532, 529, 539, 508, 590, 503, 208, 539, 537, 585, 676, 631, 625, 258, 495, 609, 95, 310, 322, 134, NA, 0, 0, NA, NA, NA, NA, NA, 3, 4, 25, 3, 4, 2, 3, 4, 5, 3, 7, 2, 1, 53, 166, 313, 320, 320, 163, 417, 381, 315, 441, 385, 443, 160, 45, 313, 647, 690, 651, 382, 199, 554, 328, 62, 319, 572, 236, 65, 64, 93, 530, 578, 580, 587, 553, 583, 547,
+#> 509, 546, 557, 299, 544, 398, 421, 240, 397, 176, 536, 519, 562, 575, 510, 520, 560, 535, 264, 417, 446, 254, 458, 24, 269, 176, 131, 89, 186, 60, 113, 192, 496, 415, 472, 102, 335, 580, 526, 511, 587, 607, 623, 505, 540, 553, 407, 494, 440, 0, 5, 5, 1, 0, 0, 0, 0, 0, 0, 3, 0, 2, 0, 0, 3, 0, 0, 0, 3, 4, 2, 0, 0, 3, 0, 1, 0, 0, 1, 0, 0, 0, 0, 455, 324, 636, 664, 563, 616, 654, 581, 143, 613, 383, 137, 196, 477, 35, 165, 551, 563, 588, 569, 319, 207, 538, 540, 385, 544, 29, 412, 0, 14, 188, 358, 379,
+#> 505, 484, 511, 481, 449, 474, 465, 506, 168, 383, 383, 344, 69, 535, 624, 588, 593, 590, 606, 202, 305, 593, 595, 561, 465, 323, 329, 431, 617, 517, 585, 562, 493, 544, 587, 586, 623, 598, 494, 503, 460, 243, 299, 25, 327, 14, 543, 467, 487, 107, 284, 275, 314, 166, 285, 18, 45, 356, 501, 552, 585, 588, 475, 625, 485, 341, 89, 30, 111, 160, 278, 228, 69, 38, 11, 379, 396, 542, 543, 540, 545, 534, 493, 308, 552, 571, 444, 544, 162, 94, 143, 0, 17, 384, 336, 564, 561, 581, 520, 372, 557, 600, 551,
+#> 451, 573, 580, 534, 606, 549, 521, 692, 647, 679, 704, 679, 695, 678, 686, 639, 680, 677, 227, 402, 520, 359, 398, 45, 124, 288, 554, 324, 637, 154, 487, 631, 622, 259, 115, 160, 327, 328, 226, 149, 425, 412, 458, 523, 422, 447, 450, 403, 387, 439, 349, 216, 95, 63, 18, 261, 382, 422, 626, 563, 626, 228, 390, 540, 607, 638, 661, 242, 414, 494, 324, 126, 1, 0, 164, 335, 66, 108, 152, 458, 436, 303, 473, 578, 372, 282, 248, 404, 204, 157, NA, NA, NA, 0, 0, 5, 0, 1, 0, 0, 1, 0, 1, 0, 0, 0, 0, 0, 590,
+#> 590, 591, 592, 591, 535, 565, 524, 568, 587, 579, 607, 391, 633, 602, 21, 473, 387, 540, 392, 262, 209, 483, 550, 547, 614, 618, 609, 524, 579, 379, 579, 586, 464, 341, 19, 318, 102, 413, 558, 509, 636, 538, 505, 138, 261, 426, 440, 329, 407, 122, 4, 5, 5, 4, 4, 62, 25, 2, 0, 4, NA, 3, 0, 2, 0, 3, 0, 0, 1, 2, 102, 598, 478, 474, 449, 468, 416, 451, 279, 339, 529, 342, 380, 168, 0, 281, 391, 126, 371, 57, 15, 49, 83, 67, 160, 98, 0, 5, 4, 6, 4, 7, 3, 62, 51, 51, 51, 13, 53, 34, 0, 1, 101, 473, 325,
+#> 428, 409, 337, 410, 433, 497, 530, 491, 202, 175, NA, 1, NA, 4, 5, 2, 4, 6, 54, 0, 0, 0, 0, 99, 365, 593, 607, 622, 662, 636, 653, 654, 648, 514, 632, 635, 401, 235, 322, 156, 1, 1, 0, 0, 0, 0, 0, 566, 449, 570, 477, 80, 197, 186, 381, 84, 106, 281, 236, 132, 52, 15, 62, 54, 71, 38, 62, 26, 0, 1, 8, 50, 574, 696, 682, 608, 637, 647, 579, 453, 477, 496, 475, 561, 362, 219, 226, 13, 374, 607, 624, 622, 620, 647, 672, 638, 638, 442, 575, 543, 417, 557, 496, 155, 1, 2, 4, 0, 1, 1, 3, 4, 4, 65, 64, 59,
+#> 65, 54, 53, 52, 4, 0, 0, 7, 31, 46, 44, 59, 7, 11, 6, 5, 0, 5, 5, 16, 8, 39, NA, 2, 0, 1, 6, 9, 6, 2, 3, 4, 4, 1, 92, 74, 53, 18, 10, 28, 44, 1, 0, 3, 0, 0, 0, 0, 0, 54, 454, 218, 477, 561, 581, 539, 605, 594, 175, 567, 623, 532, 129, 418, 334, 101, 164, 263, 153, 487, 539, 537, 606, 595, 564, 439, 584, 349, 199, 298, 486, 247, 183, 212, 352, 349, 603, 577, 466, 539, 545, 202, 12, 156, 223, 256, 49, 0, 13, 0, 2, 0, 0, 1, 0, 0, 0, 0, 0, 53, 75, 567, 512, 608, 474, 11, 226, 22, 27, 58, 74, 92, 64,
+#> 63, 0, 1, 4, 2, 31, 200, 390, 534, 414, 560, 210, 353, 13, 524, 399, 519, 107, 88, 2, 96, 608, 678, 536, 620, 611, 584, 427, 630, 590, 505, 243, 424, 169, 205, 494, 606, 486, 604, 509, 412, 309, 463, 548, 308, 15, 308, 508, 551, 597, 492, 598, 500, 573, 589, 419, 445, 218, 244, 213, 551, 379, 577, 550, 420, 30, 57, 45, 59, 70, 45, 26, 21, 30, 23, 35, 68, 77, 61, 0, 40, 7, 0, 49, 278, 20, 415, 303, 412, 448, 582, 601, 558, 549, 416, 541, 518, 525, 324, 518, 518, 528, 1, 0, 4, 3, 8, 6, 2, 7, 78, 42,
+#> 62, 35, 134, 439, 558, 670, 444, 73, 119, 191, 123, 414, 387, 473, 30, 162, 4, 129, 12, 545, 333, 358, 349, 556, 238, 12, 156, 79, 8, 411, 599, 570, 538, 184, 393, 531, 348, 444, 194, 206, 529, 545, 644, 628, 208, 286, 381, 193, 609, 601, 589, 451, 53, 440, 392, 31, 199, 215, 436, 557, 344, 550, 593, 624, 467, 513, 450, 316, 127, 32, 159, 520, 547, 572, 562, 266, 211, 377, 493, 540, 605, 561, 440, 50, 154, 418, 434, 587, 352, 384, 66, 217, 589, 620, 404, 635, 460, 261, 181, 195, 538, 510, 475, 587,
+#> 559, 598, 603, 620, 595, 556, 449, 589, 487, 604, 631, 549, 567, 298, 17, 36, 462, 357, 414, 442, 53, 22, 188, 497, 546, 576, 588, 572, 577, 574, 588, 209, 339, 605, 609, 563, 573, 502, 24, 195, 133, 390, 527, 558, 652, 587, 543, 477, 305, 266, 107, 193, 41, 173, 71, 7, 73, 144, 513, 524, 582, 570, 444, 563, 575, 566, 549, 438, 546, 548, 543, 533, 467, 208, 36, 368, 407, 375, 424, 287, 518, 252, 494, 466, 368, 452, 478, 248, 5, 19, 12, 56, 62, 60, 19, 23, 26, 56, 61, 66, 53, 66, 7, 6, 28, 32, 0,
+#> 1, 1, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 1, 2, 7, 5, 7, 6, 39, 6, 3, 3, 1, 3, 2, 0, 1, 4, 6, 62, 58, NA, 1, 1, 2, 6, 1, 62, 77, 71, 1, 5, 63, 72, 71, 6, 192, 474, 489, 461, 579, 517, 407, 551, 497, 398, 137, 123, 1, 221, 483, 448, 174, 467, 451, 463, 470, 365, 435, 423, 364, 112, 222, 47, 77, 39, 71, 73, 66, 64, 70, 49, 28, 29, 38, 0, 6, 0, 2, 0, 2, 1, 0, 0, 0, 0, 0, 0, 0, 1, 1, 0, 0, 0, 0, 0, 39, 312, 581, 529, 610, 616, 550, 557, 260, 286, 569, 467, 7, 132, 385, 411, 526, 387, 224, 58, 74, 23, 433,
+#> 271, 472, 376, 226, 456, 424, 375, 211, 133, 94, 18, 314, 603, 613, 576, 588, 616, 611, 548, 572, 622, 555, 611, 429, 492, 572, 558, 492, 623, 591, 618, 388, 236, 627, 436, 610, 605, 585, 258, 292, 2, 31, 38, 2, 72, 87, 78, 72, 59, 64, 22, 4, 42, 0, 32, 42, 16, 177, 282, 197, 264, 580, 343, 274, 603, 156, 325, 345, 259, 15, 376, 44, 97, 273, 128, 460, 641, 561, 563, 621, 611, 632, 230, 163, 66, 265, 317, 188, 517, 472, 642, 583, 655, 644, 623, 608, 621, 624, 593, 533, 555, 550, 539, 582, 207, 2,
+#> 386, 573, 666, 690, 668, 691, 639, 645, 541, 656, 631, 611, 51, 468, 14, 95, 65, 460, 580, 568, 186, 349, 445, 512, 445, 34, 139, 114, 220, 323, 564, 206, 342, 492, 503, 343, 158, 461, 587, 580, 618, 554, 469, 303, 377, 582, 608, 452, 566, 630, 500, 434, 64, 260, 503, 442, 1, 0, 13, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 50, 64, 62, 73, 73, 67, 2, 269, 657, 649, 193, 396, 488, 617, 539, 536, 481, 257, 528, 548, 453, 331, 110, 106, 280, 490, 592, 590, 623, 508, 296, 264, 505, 495, 77, 502, 168, NA, NA,
+#> 2, 22, NA, 5, 3, 5, 1, 2, 41, 57, 58, 55, 61, 50, 42, 5, 21, 10, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 1, 0, 0, 0, 0, 0, 0, 1, 4, 5, 2, 4, 4, 4, 2, 6, 0, 2, 633, 639, 589, 576, 543, 338, 251, 353, 304, 449, 401, 522, 482, 617, 597, 637, 626, 623, 627, 605, 595, 624, 14, 50, 200, 536, 490, 432, 544, 167, 335, 333, 107, 489, 521, 406, 536, 523, 510, 296, 545, 445, 455, 592, 134, 267, 543, 658, 530, 607, 571, 425, 398, 301, 476, 589, 124, 249, 180, 442, 504, 509, 488, 479, 466, 439, 356, 495, 465, 400, 479,
+#> 602, 636, 539, 346, 235, 596, 446, 599, 520, 574, 229, 2, 30, 75, 70, 80, 73, 81, 83, 69, 52, 44, 34, 274, 220, 696, 647, 681, 688, 147, 563, 537, 642, 382, 610, 193, 288, 263, 575, 582, 604, 626, 535, 587, 389, 581, 430, 535, 152, 93, 353, 577, 578, 538, 544, 468, 536, 561, 554, 460, 298, 106, 488, 81, 256, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 62, 273, 124, 452, 481, 260, 33, 490, 490, 471, 484, 493, 497, 277, 3, 59, 29, 333, 536, 373, 548, 540, 201, 562, 389, 469, 172, 460, 150, 4, 5, 6, 4, 6, 9,
+#> 3, 3, 48, 4, 5, 3, 5, 4, 2, 3, 33, 55, 59, 53, 60, 73, 49, 0, 23, 7, 1, 5, 9, 6, 0, 23, 36, 208, 79, 569, 528, 538, 491, 362, 431, 146, 292, 105, 138, 640, 655, 628, 634, 436, 128, 268, 185, 162, 98, 175, 415, 540, 553, 505, 331, 417, 422, 438, 379, 441, 257, 651, 642, 599, 304, 289, 401, 53, 601, 561, 183, 62, 24, 326, 123, 302, 157, 487, 578, 405, 612, 549, 499, 331, 331, 53, 656, 637, 628, 657, 677, 689, 716, 556, 672, 350, 567, 632, 600, 538, 517, 59, 569, 573, 588, 591, 578, 569, 581, 624, 150,
+#> 613, 4, 165, 240, 282, 575, 618, 559, 471, 392, 411, 470, 217, 265, 126, 242, 52, 99, NA, NA, NA, NA, NA, NA, 0, NA, 0, 0, 0, 0, 1, 0, 6, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 89, 520, 653, 626, 302, 635, 563, 641, 551, 381, 451, 611, 635, 619, 563, 598, 225, 530, 506, 60, 52, 4, 54, 14, 19, 2, NA, 2, 0, NA, 0, 0, 7, 0, 0, 0, 0, 0, 0, 0, 0, 2, 4, 2, 3, 64, 30, 18, 0, 49, 39, 44, 64, 76, 61, 67, 69, 69, 56, 62, 39, 3, 0, 0, 3, 8, 6, 5, 5, 5, 33,
+#> 3, 0, 75, 64, 60, 24, 2, 4, 1, 0, 0, 0, 0, 0, 0, 0, 0, 43, 70, 66, 67, 61, 45, 57, 44, 21, 42, 150, 570, 646, 616, 552, 591, 630, 484, 145, 583, 591, 571, 31, 370, 22, 9, 536, 650, 559, 584, 626, 610, 580, 606, 462, 588, 135, 385, 417, 353, 444, 481, 465, 475, 505, 505, 404, 488, 109, 270, 329, 597, 339, 168, 242, 267, 209, 57, 531, 139, 73, 17, 415, 456, 570, 620, 587, 519, 208, 387, 477, 123, 94, 84, 251, 56, 254, 603, 522, 232, 375, 547, 463, 594, 506, 554, 306, 465, 565, 570, 304, 494, 279, 196,
+#> 4, 0, 5, 3, 3, 5, 5, 6, 3, 2, 62, 448, 584, 574, 483, 273, 614, 624, 604, 1, 25, 54, 494, 331, 322, 421, 176, 148, 163, 42, 38, 187, 122, 411, 454, 636, 600, 575, 224, 230, 550, 598, 430, 106, 569, 521, 78, 298, 624, 336, 518, 487, 562, 576, 338, 170, 166, 229, 480, 351, 453, 421, 284, 276, 130, 81, 136, 26, 50, 41, 303, 538, 486, 209, 281, 112, 378, 422, 129, 357, 259, 630, 626, 644, 600, 584, 443, 606, 600, 506, 117, 435, 343, 181, 361, 546, 608, 205, 682, 528, 124, 396, 609, 327, 501, 313, 0,
+#> 0, 2, 2, 0, 1, 7, 6, 6, 49, 0, 33, 58, 60, 67, 74, 65, 477, 473, 581, 567, 648, 653, 644, 546, 0, 3, 6, 6, 3, 3, 4, 5, 6, 4, 5, 2, 67, 4, 0, 7, 58, 614, 653, 428, 610, 525, 395, 578, 568, 214, 346, 8, 119, 467, 606, 535, 227, 429, 624, 525, 444, 136, 289, 154, 292, 606, 606, 602, 602, 403, 263, 541, 596, 0, 6, 62, 60, 89, 84, 66, 71, 72, 10, 447, 393, 544, 572, 524, 233, 118, 42, 1, 3, 1, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 504, 358, 269, 93, 195, 385, 440, 60, 290, 326, 587, 569, 499, 321,
+#> 465, 290, 502, 396, 447, 525, 596, 517, 487, 556, 482, 341, 395, NA, 0, 0, 4, 3, 4, 2, 2, 2, 0, 0, 3, 2, 623, 584, 629, 172, 547, 337, 456, 482, 517, 95, 0, 5, 0, 5, 2, 2, 0, 3, 47, 45, 65, 4, 3, 8, 5, 3, 3, 65, 63, 76, 41, 12, 77, 69, 55, 38, 53, 38, 0, 4, 4, 1, 6, 2, 7, 3, 5, 2, 3, 1, 136, 271, 399, 565, 568, 322, 150, 145, 171, 302, 278, 587, 481, 518, 391, 260, 554, 21, 21, 6, 0, 6, 1, 81, 70, 61, 62, 68, 57, 63, 59, 27, 96, 609, 377, 543, 470, 537, 181, 446, 315, 323, 163, 11, 25, 40, 12, 28,
+#> 400, 532, 314, 56, 336, 569, 513, 332, 452, 553, 543, 84, 526, 469, 547, 599, 374, 581, 220, 545, 19, 25, 5, 250, 14, 173, 461, 559, 452, 73, 405, 476, 317, 202, 22, 28, 43, NA, NA, 1, 2, 3, 2, 3, 0, 0, 2, 8, 4, 2, 3, 2, 4, 4, 4, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 2, 0, 0, 0, 0, 17, 406, 162, 530, 520, 547, 557, 480, 542, 585, 614, 593, 637, 622, 583, 611, 632, 531, 564, 589, 600, 523, 448, 130, 11, 120, 40, 9, 58, 63, 68, 67, 57, 54, 4, 5, 130, 307, 115, 462, 399, 475, 585, 413, 613,
+#> 590, 31, 240, 333, 501, 462, 462, 424, 116, 554, 624, 78, 660, 303, 577, 575, 452, 29, 48, 55, 71, 58, 77, 63, 71, 354, 446, 500, 526, 523, 104, 258, 543, 493, 164, 242, 611, 642, 633, 563, 354, 491, 637, 595, 642, 629, 641, 420, 634, 642, 612, 40, 194, 346, 504, 534, 556, 517, 550, 589, 597, 455, 364, 445, 385, 601, 406, 123, 224, 323, 329, 443, 608, 595, 597, 614, 582, 549, 538, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 2, 1, 3, 0, 41, 0, 0, 0, 0, 0, 1, 61, 294, 464, 367, 330, 390, 178, 25, 162, 596, 612,
+#> 553, 631, 466, 583, 596, 214, 564, 580, 159, 352, 523, 381, 604, 555, 508, 378, 175, 505, 140, 356, 526, 495, 592, 554, 558, 566, 542, 0, 27, 0, 65, 13, 0, 1, 126, 645, 575, 395, 570, 168, 305, 574, 272, 62, 242, 174, 19, 460, 545, 414, 485, 458, 658, 459, 344, 568, 629, 145, 572, 563, 426, 396, 525, 588, 470, 0, 1, 0, 0, 0, 4, 0, 51, 59, 72, 6, 9, 3, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 3, 7, 4, 4, 6, 0, 4, 5, 4, 59, 62, 254, 611, 385, 363, 526, 372, 128, 592, 569, 414, 340, 527, 663, 601,
+#> 529, 411, 324, 451, 492, 563, 492, 212, 19, 324, 560, 151, 571, 511, 494, 429, 79, 529, 548, 501, 204, 33, 4, 23, 18, 331, 543, 610, 381, 604, 520, 191, 279, 580, 433, 570, 572, 593, 583, 548, 566, 520, 396, 587, 382, 573, 547, 36, 75, 455, 381, 365, 338, 517, 574, 632, 395, 377, 243, 488, 11, 123, 559, 589, 602, 575, 533, 424, 352, 521, 10, 22, 88, 381, 440, 487, 471, 460, 509, 472, 534, 504, 474, 464, 479, 503, 256, 82, 407, 25, 23, 502, 521, 351, 427, 370, 488, 519, 389, 73, 224, 0, 0, 413, 345,
+#> 509, 585, 560, 626, 493, 580, 20, 6, 47, 49, 60, 38, 82, 525, 584, 513, 600, 593, 583, 2, 0, 0, 0, 0, 0, 0, 0, 13, 53, 2, 4, 2, 3, 2, 69, 523, 535, 623, 503, 599, 191, 667, 327, 633, 148, 289, 496, 578, 531, 156, 514, 602, 406, 567, 486, 432, 616, 125, 577, 315, 291, 231, 415, 536, 574, 149, 286, 166, 606, 540, 535, 21, 29, 52, 335, 325, 225, 50, 16, 18, 295, 391, 120, 123, 76, 515, 584, 450, 573, 15, 296, 626, 595, 574, 347, 235, 525, 558, 398, 437, 18, 112, 102, 339, 422, 557, 547, 249, 588, 609,
+#> 529, 358, 489, 190, 379, 147, 22, 222, 399, 471, 551, 128, 337, 606, 524, 586, 0, 5, 54, 46, 28, 23, 5, 9, 31, 1, 4, 24, 355, 610, 546, 53, 265, 616, 110, 127, 0, 0, 2, 5, 6, 182, 594, 615, 590, 623, 20, 2, 3, 5, 60, 229, 404, 494, 564, 392, 416, 441, 240, 582, 476, 359, 516, 449, 425, 539, 279, 2, 39, 59, 68, 56, 66, 77, 556, 613, 46, 59, 221, 576, 626, 660, 638, 98, 293, 485, 363, 112, 297, 451, 552, 556, 611, 529, 36, 426, 596, 472, 478, 512, 543, 351, 613, 311, 4, 125, 506, 548, 605, 607, 579,
+#> 612, 18, 58, 65, 3, 4, 3, 0, 15, 39, 79, 0, 331, 505, 487, 529, 201, 399, 403, 230, 23, 195, 493, 630, 224, 303, 94, 609, 615, 81, 443, 265, 609, 167, 510, 495, 579, 196, 435, 499, 491, 507, 32, 274, 579, 608, 620, 131, 508, 391, 571, 658, 596, 499, 387, 559, 197, 119, 61, 566, 193, 484, 602, 154, 213, 569, 208, 395, 296, 441, 596, 44, 538, 613) x c(25, 32, 18, 32, 22, 35, 27, 0, 1, 21, 0, 9, 33, 47, 45, 62, 44, 42, 81, 64, 65, 73, 94, 94, 63, 80, 83, 84, 77, 41, 11, 25, 62, 59, 53, 48, 76, 89, 32, 42, 43, 1, 27, 30, 59, 48, 34, 30, 25, 6, 17, 20, 11, 8, 49, 44, 106, 167, 96, 123, 112, 112, 63, 4, 18, 24, 39, 27, 20, 26, 27, 10, 17, 18, 2, 0, 6, 10, 0, 16, 34, 21, 40, 20, 36, 18, 28, 7, 8, 18, 8, 15, 31, 30, 19, 32, 20, 14, 25, 23, 0, 60, 144, 161, 134, 125, 147, 160, 110, 97, 130, 97, 103, 27, 40, 10, 7, 0, 6, 23, 14, 23, 24, 20, 31, 14,
+#> 20, 22, 13, 20, 17, 21, 14, 8, 9, 10, 9, 6, 0, 0, 1, 36, 107, 113, 70, 95, 145, 81, 0, 90, 92, 29, 88, 53, 77, 56, 94, 36, 66, 66, 37, 40, 33, 0, 2, 6, 16, 0, 8, 4, 6, 4, 5, 4, 4, 2, 0, 1, 10, 10, 13, 15, 13, 6, 8, 11, 9, 9, 12, 14, 7, 8, 3, 1, 1, 60, 84, 72, 50, 60, 67, 82, 61, 49, 15, 43, 27, 85, 66, 71, 30, 58, 4, 61, 86, 25, 26, 103, 81, 62, 8, 50, 0, 15, 43, 39, 31, 26, 32, 41, 34, 33, 0, 12, 12, 15, 3, 1, 10, 36, 54, 36, 10, 29, 25, 37, 30, 40, 11, 10, 26, 9, 0, 0, 25, 68, 91, 92, 88, 49, 73,
+#> 65, 102, 102, 83, 83, 109, 81, 78, 74, 81, 41, 6, 0, 78, 91, 77, 89, 33, 60, 5, 5, 12, 7, 10, 5, 12, 23, 12, 1, 0, 0, 0, 1, 8, 8, 3, 6, 4, 6, 6, 3, 2, 11, 2, 0, 16, 16, 11, 12, 16, 5, 20, 5, 6, 6, 11, 3, 1, 0, 1, 19, 45, 97, 88, 116, 106, 147, 120, 70, 69, 144, 113, 107, 83, 92, 86, 124, 99, 103, 115, 97, 48, 104, 54, 0, 16, 19, 99, 81, 91, 70, 69, 71, 63, 57, 67, 64, 56, 59, 36, 47, 35, 39, 11, 3, 1, 0, 0, 3, 81, 74, 76, 61, 59, 61, 71, 42, 59, 19, 1, 0, 40, 30, 16, 87, 81, 58, 69, 57, 70, 27, 35,
+#> 22, 8, 20, 42, 19, 8, 26, 49, 67, 41, 26, 45, 44, 51, 31, 32, 8, 26, 20, 49, 40, 107, 30, 110, 42, 17, 124, 15, 71, 33, 3, 27, 1, 54, 96, 96, 120, 116, 122, 84, 118, 103, 88, 51, 95, 69, 97, 83, 97, 57, 73, 0, 0, 0, 4, 8, 6, 11, 6, 5, 13, 9, 8, 3, 2, 2, 4, 10, 2, 6, 3, 3, 6, 6, 8, 3, 6, 2, 1, 37, 80, 98, 107, 101, 105, 97, 97, 114, 103, 98, 100, 92, 90, 87, 91, 51, 60, 68, 45, 15, 23, 35, 64, 125, 106, 115, 77, 66, 88, 79, 76, 84, 61, 83, 101, 43, 52, 7, 70, 49, 44, 65, 66, 83, 88, 87, 29, 73, 81,
+#> 81, 38, 33, 5, 20, 0, 0, 9, 14, 8, 8, 10, 9, 9, 12, 5, 3, 9, 6, 5, 6, 4, 4, 10, 3, 4, 6, 3, 1, 1, 3, 3, 3, 1, 16, 67, 77, 44, 42, 57, 93, 105, 90, 85, 54, 66, 31, 12, 21, 11, 35, 2, 0, 39, 104, 81, 92, 137, 125, 122, 118, 87, 91, 51, 87, 117, 79, 92, 89, 108, 80, 66, 50, 3, 0, 1, 5, 13, 25, 36, 29, 34, 17, 18, 10, 7, 1, 0, 0, 8, 31, 25, 13, 16, 4, 0, 0, 12, 73, 92, 88, 136, 94, 101, 108, 102, 90, 73, 83, 137, 107, 85, 133, 94, 79, 96, 71, 28, 10, 15, 18, 9, 12, 6, 9, 4, 5, 6, 7, 5, 8, 6, 7, 3, 0,
+#> 3, 7, 6, 14, 18, 16, 12, 23, 14, 13, 15, 10, 13, 6, 10, 8, 11, 18, 12, 6, 6, 20, 11, 14, 15, 13, 16, 13, 13, 15, 4, 13, 1, 4, 11, 0, 1, 4, 9, 15, 16, 10, 2, 6, 1, 41, 30, 25, 32, 74, 13, 114, 90, 126, 107, 98, 97, 99, 73, 112, 74, 82, 85, 72, 15, 17, 6, 14, 8, 28, 37, 42, 53, 32, 23, 6, 19, 28, 4, 1, 0, 0, 1, 0, 9, 9, 5, 13, 8, 4, 1, 0, 2, 4, 7, 6, 5, 1, 3, 1, 32, 37, 26, 38, 39, 83, 89, 92, 103, 58, 65, 53, 54, 23, 2, 3, 0, 0, 75, 20, 64, 97, 97, 92, 71, 66, 102, 93, 126, 83, 60, 50, 24, 99, 80,
+#> 42, 14, 1, 0, 2, 4, 8, 6, 5, 7, 0, 4, 5, 0, 1, 7, 43, 30, 67, 55, 60, 83, 66, 28, 7, 11, 65, 29, 2, 0, 12, 20, 6, 22, 14, 33, 14, 3, 0, 0, 4, 19, 25, 17, 37, 35, 25, 12, 0, 9, 4, 24, 4, 20, 31, 10, 1, 0, 8, 2, 4, 6, 0, 10, 8, 11, 9, 10, 5, 6, 6, 9, 5, 7, 4, 7, 2, 3, 0, 1, 6, 31, 36, 41, 35, 38, 17, 21, 11, 0, 3, 2, 4, 51, 100, 77, 75, 79, 60, 110, 79, 79, 92, 96, 72, 44, 24, 17, 46, 11, 1, 7, 7, 0, 2, 0, 0, 5, 73, 83, 96, 116, 116, 84, 46, 57, 65, 70, 46, 30, 0, 17, 24, 45, 35, 19, 16, 27, 16, 19,
+#> 9, 9, 12, 0, 5, 3, 3, 0, 5, 2, 0, 3, 1, 0, 3, 15, 126, 121, 109, 61, 21, 42, 91, 91, 9, 79, 105, 20, 18, 41, 45, 25, 18, 28, 42, 30, 18, 20, 6, 10, 2, 9, 1, 15, 25, 48, 60, 37, 33, 24, 21, 8, 5, 12, 7, 9, 18, 9, 10, 17, 1, 6, 9, 8, 4, 10, 3, 7, 1, 1, 7, 13, 2, 0, 67, 89, 81, 76, 89, 62, 75, 59, 50, 79, 97, 69, 114, 63, 47, 16, 65, 86, 97, 102, 98, 67, 87, 86, 6, 55, 48, 38, 61, 48, 1, 7, 39, 61, 71, 50, 43, 94, 37, 98, 83, 46, 6, 4, 0, 3, 1, 9, 14, 5, 3, 0, 3, 3, 6, 0, 1, 2, 3, 3, 4, 0, 3, 4, 10,
+#> 76, 83, 79, 74, 44, 42, 50, 40, 32, 50, 72, 58, 70, 57, 19, 12, 0, 0, 7, 55, 80, 88, 64, 50, 51, 47, 53, 50, 67, 72, 101, 74, 4, 3, 4, 12, 22, 26, 11, 13, 11, 38, 22, 42, 19, 6, 5, 46, 0, 22, 0, 4, 1, 29, 62, 53, 61, 34, 75, 43, 38, 2, 0, 0, 17, 23, 35, 80, 95, 69, 75, 65, 54, 22, 61, 43, 56, 10, 40, 49, 63, 96, 102, 83, 59, 51, 82, 78, 69, 21, 57, 8, 47, 64, 59, 72, 80, 71, 64, 33, 30, 1, 7, 9, 9, 8, 4, 2, 32, 44, 64, 41, 41, 36, 43, 58, 77, 46, 39, 46, 17, 36, 40, 41, 43, 16, 9, 3, 4, 10, 7, 3,
+#> 3, 2, 6, 1, 0, 5, 1, 2, 1, 13, 56, 64, 73, 75, 62, 57, 30, 16, 28, 45, 13, 8, 86, 52, 56, 12, 43, 7, 0, 63, 78, 76, 89, 70, 70, 43, 34, 2, 15, 78, 55, 70, 64, 66, 64, 76, 38, 39, 70, 89, 91, 92, 63, 92, 125, 68, 34, 7, 38, 30, 46, 36, 48, 35, 57, 64, 32, 57, 42, 15, 44, 26, 2, 0, 0, 9, 3, 8, 2, 5, 2, 2, 2, 6, 2, 6, 8, 68, 74, 51, 79, 69, 3, 44, 48, 90, 115, 78, 62, 37, 32, 0, 40, 87, 85, 69, 67, 46, 3, 4, 38, 25, 24, 26, 30, 37, 35, 30, 32, 20, 24, 10, 21, 6, 0, 0, 2, 11, 81, 100, 83, 105, 103, 80,
+#> 86, 115, 111, 104, 99, 43, 65, 5, 9, 4, 0, 33, 78, 77, 18, 46, 43, 7, 6, 5, 0, 3, 3, 3, 2, 1, 8, 51, 0, 59, 72, 85, 91, 86, 79, 86, 54, 63, 91, 82, 7, 2, 2, 2, 1, 19, 41, 23, 18, 5, 7, 7, 26, 36, 34, 37, 37, 21, 10, 7, 85, 53, 56, 69, 45, 79, 23, 121, 117, 80, 49, 75, 70, 44, 47, 35, 0, 42, 74, 94, 87, 74, 60, 5, 19, 3, 17, 12, 59, 55, 53, 49, 54, 88, 67, 98, 98, 101, 78, 63, 86, 31, 11, 1, 0, 4, 3, 13, 3, 0, 5, 5, 2, 2, 0, 2, 28, 83, 60, 69, 96, 137, 125, 134, 94, 100, 78, 87, 71, 1, 67, 54, 1,
+#> 16, 18, 14, 50, 103, 158, 177, 94, 151, 143, 61, 139, 158, 163, 121, 150, 149, 120, 97, 78, 13, 38, 16, 51, 53, 37, 72, 46, 54, 61, 30, 40, 69, 57, 27, 15, 39, 5, 63, 86, 51, 68, 96, 131, 141, 89, 121, 133, 96, 133, 99, 156, 15, 64, 10, 2, 9, 2, 1, 1, 7, 1, 9, 1, 16, 0, 42, 27, 32, 12, 18, 14, 17, 23, 5, 13, 25, 14, 1, 0, 0, 25, 72, 88, 64, 8, 0, 68, 7, 29, 5, 55, 51, 64, 83, 78, 64, 37, 89, 102, 65, 73, 75, 16, 68, 88, 1, 10, 4, 9, 7, 1, 10, 7, 5, 10, 6, 6, 6, 5, 10, 29, 78, 59, 101, 50, 98, 84,
+#> 75, 97, 0, 14, 3, 18, 25, 27, 26, 22, 28, 30, 17, 16, 11, 2, 26, 73, 34, 4, 82, 61, 73, 81, 68, 29, 88, 67, 91, 95, 83, 20, 76, 46, 2, 77, 114, 99, 76, 76, 90, 82, 70, 41, 74, 85, 140, 120, 113, 109, 18, 46, 70, 41, 2, 0, 2, 5, 1, 4, 8, 8, 9, 11, 11, 18, 9, 11, 12, 2, 0, 1, 17, 19, 28, 32, 30, 21, 34, 46, 63, 39, 33, 31, 29, 7, 14, 4, 29, 81, 93, 98, 100, 85, 90, 75, 89, 81, 76, 91, 74, 111, 87, 107, 62, 0, 6, 4, 3, 2, 3, 10, 8, 4, 7, 13, 5, 14, 2, 72, 51, 53, 71, 90, 46, 28, 41, 72, 69, 68, 58,
+#> 42, 56, 49, 56, 46, 57, 15, 1, 7, 5, 8, 9, 10, 15, 15, 11, 12, 4, 10, 17, 11, 3, 9, 4, 4, 1, 1, 0, 0, 0, 1, 18, 1, 35, 55, 67, 65, 63, 59, 89, 109, 128, 62, 73, 72, 67, 19, 23, 2, 52, 37, 61, 76, 62, 56, 85, 96, 85, 63, 66, 98, 0, 1, 2, 35, 69, 54, 37, 36, 62, 83, 51, 82, 29, 12, 1, 0, 1, 1, 1, 4, 1, 14, 10, 8, 9, 2, 0, 6, 11, 3, 1, 0, 26, 77, 3, 80, 83, 83, 91, 117, 106, 111, 98, 98, 95, 119, 121, 81, 58, 19, 48, 0, 12, 12, 5, 8, 17, 8, 4, 3, 0, 8, 1, 6, 10, 13, 3, 4, 9, 3, 3, 8, 1, 1, 2, 0, 1,
+#> 2, 8, 18, 14, 9, 11, 12, 6, 6, 0, 66, 25, 37, 40, 40, 41, 41, 65, 64, 48, 56, 3, 10, 15, 1, 16, 9, 31, 23, 22, 30, 21, 39, 16, 9, 5, 70, 73, 92, 90, 105, 121, 112, 82, 62, 3, 11, 4, 1, 1, 8, 10, 8, 8, 7, 6, 3, 7, 2, 3, 8, 4, 4, 0, 0, 3, 8, 9, 10, 3, 6, 10, 18, 7, 2, 9, 3, 12, 5, 5, 3, 21, 57, 121, 101, 116, 121, 89, 75, 112, 107, 93, 121, 96, 59, 74, 74, 52, 40, 3, 2, 4, 0, 2, 12, 69, 95, 96, 82, 91, 87, 70, 27, 46, 73, 22, 18, 23, 17, 46, 47, 61, 78, 100, 113, 79, 42, 31, 15, 1, 4, 8, 8, 6, 5, 11,
+#> 9, 9, 5, 11, 5, 0, 0, 0, 1, 4, 3, 9, 26, 25, 65, 54, 45, 44, 111, 105, 50, 39, 44, 33, 14, 1, 1, 8, 6, 2, 4, 9, 8, 1, 14, 19, 15, 12, 13, 10, 5, 1, 0, 0, 0, 8, 9, 3, 13, 4, 7, 6, 4, 5, 2, 8, 6, 5, 3, 3, 2, 3, 6, 3, 3, 6, 7, 8, 7, 10, 8, 6, 4, 4, 2, 6, 0, 2, 2, 3, 1, 0, 8, 3, 12, 12, 6, 5, 18, 2, 6, 7, 3, 59, 70, 82, 48, 74, 109, 96, 96, 79, 88, 19, 72, 49, 30, 2, 1, 9, 22, 40, 58, 58, 53, 31, 21, 14, 11, 1, 4, 1, 3, 0, 25, 57, 57, 34, 74, 66, 114, 92, 121, 107, 97, 90, 106, 83, 86, 79, 3, 7, 4, 21,
+#> 21, 23, 10, 10, 16, 4, 9, 18, 15, 8, 2, 0, 1, 1, 1, 1, 0, 1, 3, 6, 4, 9, 6, 4, 14, 6, 4, 2, 5, 6, 0, 1, 14, 101, 80, 98, 99, 78, 91, 83, 79, 90, 44, 102, 95, 87, 0, 11, 6, 38, 62, 64, 78, 53, 73, 58, 68, 67, 66, 58, 65, 66, 38, 24, 0, 13, 0, 0, 1, 9, 11, 29, 32, 68, 73, 25, 2, 37, 63, 19, 23, 6, 35, 37, 11, 7, 16, 3, 10, 0, 0, 0, 5, 3, 6, 7, 9, 8, 7, 7, 8, 8, 8, 10, 8, 1, 1, 0, 0, 0, 1, 6, 7, 9, 3, 4, 1, 0, 5, 1, 0, 0, 0, 9, 5, 7, 8, 2, 10, 7, 4, 4, 6, 2, 1, 1, 1, 1, 7, 42, 62, 56, 83, 103, 87, 84,
+#> 56, 71, 65, 70, 68, 78, 83, 83, 11, 45, 20, 7, 3, 0, 5, 37, 41, 45, 43, 40, 20, 19, 9, 16, 41, 4, 50, 3, 69, 94, 87, 130, 98, 109, 89, 73, 63, 56, 64, 7, 0, 10, 0, 15, 2, 5, 11, 3, 8, 7, 4, 1, 0, 7, 1, 1, 0, 2, 7, 7, 9, 5, 11, 13, 6, 8, 6, 1, 4, 5, 8, 4, 0, 2, 1, 45, 81, 51, 64, 67, 73, 92, 70, 65, 23, 11, 75, 74, 41, 6, 0, 89, 108, 86, 114, 83, 93, 91, 94, 90, 81, 74, 85, 62, 24, 3, 4, 28, 56, 61, 35, 56, 61, 2, 84, 53, 52, 55, 58, 67, 49, 47, 40, 36, 3, 20, 5, 48, 59, 77, 69, 71, 78, 35, 64, 82,
+#> 64, 63, 39, 44, 43, 12, 25, 5, 0, 1, 0, 18, 30, 41, 34, 63, 50, 55, 42, 61, 31, 16, 18, 6, 1, 10, 13, 4, 69, 50, 80, 92, 113, 110, 87, 118, 104, 74, 93, 24, 27, 69, 122, 90, 86, 78, 114, 152, 105, 144, 85, 102, 68, 96, 60, 79, 39, 0, 7, 1, 9, 1, 8, 44, 86, 100, 116, 105, 96, 80, 82, 81, 34, 114, 88, 97, 106, 88, 122, 30, 6, 0, 10, 6, 7, 16, 10, 7, 20, 6, 11, 11, 9, 5, 2, 6, 9, 5, 4, 8, 10, 0, 0, 0, 4, 94, 144, 113, 60, 92, 111, 155, 110, 58, 37, 80, 22, 36, 96, 48, 45, 80, 97, 73, 78, 63, 4, 83,
+#> 36, 50, 19, 1, 29, 79, 87, 92, 98, 95, 123, 108, 92, 73, 45, 57, 72, 44, 72, 11, 5, 20, 35, 29, 22, 2, 1, 12, 34, 29, 16, 8, 3, 9, 0, 3, 4, 5, 4, 13, 8, 1, 3, 1, 0, 2, 0, 0, 0, 55, 49, 60, 42, 61, 63, 7, 1, 52, 71, 91, 64, 69, 97, 84, 29, 1, 0, 5, 57, 58, 82, 63, 85, 70, 72, 49, 9, 68, 76, 59, 52, 2, 59, 83, 46, 95, 102, 104, 85, 26, 74, 110, 121, 115, 88, 68, 43, 57, 9, 2, 0, 4, 43, 74, 91, 75, 135, 120, 3, 69, 4, 3, 6, 8, 10, 13, 11, 8, 10, 9, 4, 5, 5, 6, 8, 3, 4, 6, 6, 9, 14, 3, 4, 4, 8, 8, 1,
+#> 0, 0, 62, 28, 97, 119, 89, 135, 146, 66, 77, 41, 24, 0, 0, 0, 3, 3, 3, 10, 0, 6, 9, 13, 1, 4, 1, 4, 1, 0, 5, 6, 3, 5, 2, 1, 1, 6, 2, 73, 135, 149, 139, 127, 143, 163, 138, 138, 128, 125, 167, 138, 115, 2, 79, 92, 62, 101, 109, 67, 79, 94, 59, 72, 82, 56, 21, 6, 7, 0, 1, 3, 8, 4, 7, 8, 5, 4, 10, 15, 9, 2, 0, 1, 5, 0, 1, 1, 2, 4, 4, 1, 1, 0, 5, 5, 9, 9, 3, 9, 2, 4, 5, 2, 0, 0, 4, 0, 0, 1, 8, 15, 5, 8, 4, 7, 4, 1, 3, 8, 1, 7, 2, 4, 4, 4, 0, 6, 9, 6, 8, 3, 8, 4, 6, 4, 5, 3, 3, 1, 1, 1, 2, 3, 3, 101,
+#> 114, 142, 131, 117, 88, 107, 101, 122, 98, 107, 94, 77, 62, 32, 5, 40, 43, 29, 16, 1, 0, 1, 26, 75, 26, 101, 100, 103, 139, 121, 124, 68, 109, 91, 36, 27, 32, 42, 40, 50, 11, 45, 59, 54, 45, 36, 34, 25, 38, 25, 15, 0, 0, 2, 133, 121, 134, 32, 90, 90, 59, 95, 83, 67, 80, 79, 49, 30, 7, 17, 2, 23, 3, 2, 5, 5, 3, 1, 11, 6, 2, 6, 5, 11, 7, 1, 1, 6, 1, 0, 8, 6, 2, 5, 4, 4, 6, 3, 1, 4, 12, 2, 1, 2, 2, 8, 4, 0, 1, 10, 36, 30, 62, 101, 101, 108, 94, 34, 77, 75, 10, 39, 7, 1, 4, 2, 11, 13, 4, 12, 9, 9, 10,
+#> 5, 3, 3, 2, 0, 1, 19, 43, 90, 107, 99, 99, 127, 38, 83, 70, 59, 49, 12, 38, 55, 33, 5, 78, 60, 38, 97, 20, 65, 21, 0, 8, 2, 3, 62, 110, 108, 131, 144, 67, 112, 103, 134, 123, 144, 133, 133, 86, 108, 65, 6, 13, 4, 81, 88, 66, 50, 68, 93, 54, 61, 39, 76, 69, 48, 71, 49, 52, 45, 62, 10, 9, 0, 10, 117, 113, 137, 118, 119, 129, 120, 143, 86, 47, 47, 3, 6, 11, 12, 10, 5, 5, 4, 1, 4, 0, 1, 4, 6, 6, 6, 8, 3, 9, 2, 4, 0, 0, 12, 19, 24, 14, 26, 12, 25, 20, 7, 7, 1, 6, 0, 0, 2, 3, 78, 82, 94, 87, 83, 2, 47,
+#> 3, 18, 32, 51, 74, 19, 5, 13, 0, 8, 8, 12, 12, 7, 5, 2, 0, 4, 0, 0, 5, 1, 15, 14, 8, 15, 18, 15, 13, 14, 11, 6, 11, 8, 1, 3, 6, 5, 9, 11, 6, 9, 15, 9, 4, 3, 3, 5, 5, 2, 0, 2, 2, 0, 2, 67, 152, 122, 85, 120, 14, 31, 27, 2, 8, 23, 85, 123, 127, 93, 151, 125, 120, 118, 130, 111, 139, 130, 106, 87, 18, 25, 0, 30, 110, 102, 140, 116, 83, 128, 109, 136, 121, 101, 8, 58, 10, 2, 9, 2, 23, 72, 127, 103, 95, 89, 68, 70, 36, 102, 98, 97, 104, 98, 7, 8, 24, 1, 0, 0, 2, 8, 5, 3, 6, 3, 8, 3, 2, 0, 3, 54, 45, 9,
+#> 57, 62, 88, 71, 50, 54, 45, 8, 39, 8, 0, 1, 0, 6, 0, 14, 10, 11, 5, 6, 8, 4, 2, 3, 1, 7, 5, 7, 3, 11, 9, 9, 14, 5, 7, 5, 5, 2, 8, 5, 0, 6, 3, 7, 2, 8, 10, 4, 2, 4, 4, 2, 3, 3, 3, 6, 7, 5, 15, 16, 10, 3, 12, 2, 4, 2, 2, 8, 7, 6, 1, 0, 0, 41, 126, 158, 121, 152, 101, 78, 71, 19, 83, 74, 53, 8, 37, 39, 6, 0, 0, 1, 1, 8, 9, 3, 8, 4, 1, 8, 5, 3, 0, 5, 4, 0, 0, 3, 8, 9, 12, 9, 9, 10, 5, 4, 6, 6, 1, 2, 2, 1, 14, 102, 82, 79, 113, 101, 106, 86, 111, 77, 77, 4, 76, 76, 24, 32, 3, 2, 0, 4, 10, 5, 8, 9, 1,
+#> 1, 1, 1, 5, 2, 0, 1, 10, 8, 15, 18, 7, 8, 3, 4, 2, 0, 0, 0, 27, 101, 69, 88, 118, 78, 102, 60, 71, 91, 67, 37, 76, 0, 44, 53, 48, 0, 1, 60, 55, 65, 66, 58, 56, 54, 99, 87, 84, 98, 45, 35, 28, 29, 10, 1, 85, 89, 69, 89, 88, 77, 57, 70, 79, 65, 62, 79, 18, 2, 9, 59, 60, 75, 77, 88, 93, 90, 93, 78, 68, 17, 51, 52, 7, 3, 14, 2, 11, 7, 6, 4, 4, 10, 3, 7, 9, 7, 12, 10, 8, 6, 0, 1, 1, 4, 5, 5, 7, 9, 10, 9, 5, 11, 5, 2, 5, 4, 0, 1, 98, 94, 90, 84, 92, 91, 88, 14, 40, 74, 5, 36, 0, 3, 0, 60, 38, 44, 39, 58,
+#> 50, 46, 31, 19, 32, 20, 15, 33, 17, 40, 27, 22, 13, 9, 13, 92, 110, 132, 115, 111, 100, 98, 62, 21, 100, 69, 13, 41, 64, 17, 14, 7, 19, 0, 1, 3, 2, 5, 4, 7, 3, 9, 5, 4, 3, 0, 0, 71, 85, 115, 108, 122, 71, 88, 94, 113, 69, 82, 112, 24, 19, 5, 64, 0, 129, 84, 89, 85, 92, 115, 105, 56, 51, 6, 15, 19, 16, 2, 1, 7, 7, 10, 2, 0, 14, 4, 9, 3, 1, 0, 0, 8, 7, 11, 2, 9, 11, 3, 5, 3, 8, 4, 1, 3, 2, 9, 0, 1, 2, 20, 82, 77, 81, 53, 15, 2, 17, 51, 25, 7, 23, 69, 138, 122, 104, 119, 98, 119, 113, 120, 99, 116,
+#> 85, 89, 89, 118, 65, 91, 73, 2, 0, 1, 0, 53, 56, 106, 108, 110, 89, 76, 80, 83, 47, 1, 3, 8, 19, 8, 9, 9, 12, 4, 11, 6, 10, 0, 0, 59, 118, 121, 10, 137, 144, 112, 129, 12, 47, 91, 71, 0, 12, 37, 73, 109, 99, 96, 99, 90, 116, 110, 94, 93, 71, 79, 69, 62, 26, 21, 1, 1, 80, 106, 53, 71, 93, 76, 81, 121, 89, 45, 0, 2, 82, 101, 116, 46, 116, 91, 69, 49, 38, 42, 54, 70, 21, 11, 5, 68, 47, 122, 74, 121, 121, 60, 34, 48, 28, 15, 35, 77, 79, 52, 72, 48, 84, 22, 4, 132, 151, 129, 108, 93, 122, 123, 81, 97,
+#> 110, 58, 114, 72, 0, 5, 12, 12, 10, 0, 9, 12, 2, 1, 3, 8, 1, 3, 1, 1, 5, 7, 2, 12, 12, 5, 12, 10, 3, 0, 6, 3, 2, 1, 2, 60, 98, 113, 86, 68, 91, 78, 73, 82, 82, 79, 23, 20, 32, 26, 49, 47, 17, 2, 36, 66, 90, 75, 94, 111, 98, 41, 82, 96, 93, 78, 63, 12, 59, 67, 63, 82, 11, 32, 10, 54, 75, 102, 106, 109, 112, 101, 111, 91, 78, 65, 110, 55, 28, 93, 26, 78, 72, 67, 68, 111, 69, 82, 21, 23, 4, 4, 11, 8, 7, 7, 8, 4, 5, 1, 7, 6, 5, 0, 5, 5, 0, 3, 5, 6, 11, 4, 0, 7, 2, 2, 2, 0, 7, 7, 2, 6, 2, 0, 0, 3, 0,
+#> 1, 1, 2, 11, 1, 0, 6, 1, 73, 89, 87, 64, 93, 42, 12, 58, 41, 1, 44, 56, 27, 9, 6, 4, 0, 0, 0, 0, 76, 103, 85, 104, 111, 67, 97, 70, 137, 110, 59, 4, 43, 37, 9, 6, 4, 68, 60, 93, 104, 63, 68, 68, 20, 3, 18, 5, 4, 10, 5, 5, 7, 2, 0, 0, 2, 1, 0, 0, 54, 108, 116, 143, 132, 139, 102, 106, 42, 0, 6, 8, 5, 12, 9, 2, 15, 14, 20, 10, 11, 13, 14, 11, 12, 12, 8, 10, 8, 4, 1, 2, 14, 31, 45, 28, 3, 27, 9, 7, 47, 57, 43, 30, 27, 58, 46, 29, 7, 12, 12, 23, 7, 0, 6, 8, 104, 64, 55, 89, 82, 58, 20, 60, 46, 23, 81,
+#> 64, 17, 0, 0, 0, 6, 0, 6, 11, 9, 2, 9, 6, 0, 9, 3, 0, 5, 4, 0, 0, 4, 3, 0, 5, 0, 1, 2, 0, 0, 1, 2, 6, 1, 6, 6, 7, 9, 6, 3, 6, 5, 1, 0, 1, 5, 89, 99, 93, 77, 58, 56, 85, 68, 46, 24, 7, 14, 20, 43, 30, 42, 36, 42, 41, 60, 43, 50, 33, 32, 19, 37, 46, 19, 8, 0, 8, 16, 3, 30, 59, 79, 65, 58, 45, 6, 8, 5, 4, 10, 3, 4, 8, 2, 3, 0, 5, 0, 1, 0, 0, 86, 81, 86, 103, 85, 78, 14, 21, 31, 24, 83, 92, 112, 104, 88, 82, 35, 89, 96, 74, 59, 103, 111, 103, 91, 91, 114, 115, 93, 98, 78, 65, 106, 71, 2, 1, 6, 14, 7,
+#> 11, 2, 9, 8, 1, 7, 7, 10, 5, 3, 6, 0, 0, 1, 3, 1, 1, 10, 2, 6, 1, 1, 0, 6, 9, 2, 4, 1, 4, 0, 1, 0, 0, 131, 134, 135, 141, 142, 125, 124, 150, 82, 109, 2, 17, 93, 77, 71, 96, 81, 32, 56, 2, 8, 27, 10, 36, 14, 12, 15, 10, 6, 16, 11, 6, 13, 11, 9, 11, 6, 3, 1, 0, 9, 4, 6, 4, 6, 8, 10, 3, 0, 5, 4, 5, 3, 3, 0, 25, 77, 88, 63, 33, 76, 95, 102, 78, 66, 78, 46, 4, 10, 6, 1, 41, 27, 21, 64, 68, 93, 56, 75, 36, 6, 1, 17, 110, 44, 24, 50, 65, 68, 20, 11, 104, 101, 145, 103, 119, 90, 92, 108, 108, 43, 4, 4,
+#> 49, 0, 24, 59, 24, 56, 66, 73, 66, 8, 14, 16, 62, 39, 12, 15, 11, 0, 87, 102, 102, 106, 97, 26, 98, 36, 41, 17, 7, 6, 0, 2, 37, 78, 74, 83, 95, 116, 82, 36, 69, 68, 42, 3, 23, 17, 12, 0, 3, 32, 78, 54, 47, 49, 48, 46, 30, 69, 45, 21, 17, 8, 76, 73, 65, 56, 57, 58, 53, 27, 2, 1, 6, 3, 5, 14, 8, 7, 7, 0, 1, 2, 6, 0, 0, 1, 3, 3, 2, 7, 48, 85, 77, 72, 96, 55, 60, 106, 4, 45, 10, 8, 17, 52, 88, 106, 101, 106, 105, 92, 92, 89, 56, 24, 86, 50, 88, 56, 81, 75, 6, 23, 0, 3, 0, 7, 5, 0, 1, 2, 0, 2, 1, 8, 10,
+#> 5, 7, 1, 1, 1, 6, 5, 5, 2, 0, 0, 0, 0, 10, 4, 6, 1, 1, 2, 6, 0, 2, 3, 2, 85, 33, 34, 117, 89, 75, 68, 17, 32, 12, 22, 7, 0, 0, 0, 5, 5, 6, 2, 2, 5, 0, 6, 4, 0, 0, 0, 59, 95, 96, 71, 100, 100, 100, 91, 92, 82, 48, 73, 64, 19, 49, 1, 37, 15, 24, 21, 0, 10, 34, 40, 49, 43, 69, 51, 53, 53, 84, 23, 50, 45, 46, 28, 22, 26, 5, 79, 71, 49, 72, 59, 59, 80, 0, 86, 84, 67, 83, 72, 47, 74, 47, 49, 91, 35, 2, 1, 8, 5, 6, 5, 3, 0, 1, 3, 1, 4, 5, 5, 6, 4, 4, 2, 0, 10, 10, 8, 5, 6, 7, 2, 6, 2, 3, 0, 4, 3, 0, 3,
+#> 8, 3, 0, 0, 2, 10, 2, 5, 4, 6, 9, 0, 1, 9, 5, 5, 22, 94, 72, 83, 83, 62, 71, 3, 46, 0, 84, 75, 91, 90, 67, 74, 114, 113, 125, 62, 35, 14, 16, 31, 0, 10, 0, 4, 5, 4, 6, 7, 9, 5, 2, 5, 0, 3, 0, 5, 1, 2, 1, 0, 0, 6, 2, 1, 0, 0, 44, 50, 66, 38, 50, 63, 51, 57, 70, 61, 36, 16, 0, 17, 45, 32, 27, 32, 53, 31, 43, 5, 15, 22, 10, 6, 105, 115, 106, 124, 111, 112, 93, 10, 26, 43, 5, 17, 0, 72, 85, 66, 105, 91, 81, 90, 77, 71, 78, 16, 40, 4, 70, 51, 67, 59, 48, 44, 5, 52, 23, 0, 7, 4, 5, 9, 9, 18, 11, 7, 5,
+#> 6, 2, 6, 6, 3, 1, 0, 0, 4, 11, 1, 2, 0, 12, 8, 4, 3, 1, 2, 0, 91, 53, 64, 59, 50, 17, 0, 0, 8, 87, 108, 112, 124, 113, 135, 128, 105, 124, 105, 127, 120, 97, 87, 82, 64, 37, 49, 46, 57, 34, 0, 0, 5, 14, 12, 9, 9, 10, 10, 4, 2, 5, 1, 3, 19, 58, 52, 56, 3, 29, 79, 40, 34, 14, 52, 3, 42, 33, 12, 21, 0, 11, 5, 7, 56, 71, 1, 2, 59, 73, 57, 64, 41, 64, 2, 1, 34, 125, 107, 75, 102, 90, 29, 0, 32, 10, 0, 0, 3, 3, 1, 4, 10, 9, 6, 5, 6, 8, 6, 4, 5, 1, 0, 0, 18, 88, 74, 75, 82, 85, 80, 50, 93, 99, 77, 94, 73,
+#> 33, 24, 19, 37, 69, 87, 85, 43, 0, 0, 51, 59, 44, 0, 50, 37, 14, 38, 1, 7, 0, 0, 8, 4, 3, 3, 0, 2, 1, 0, 22, 70, 75, 87, 74, 71, 78, 95, 95, 79, 94, 91, 103, 60, 1, 68, 2, 1, 12, 3, 105, 84, 27, 30, 75, 88, 57, 83, 77, 102, 80, 77, 39, 26, 6, 20, 78, 37, 78, 88, 77, 37, 5, 64, 67, 76, 58, 59, 49, 68, 77, 62, 42, 14, 26, 8, 0, 5, 5, 50, 0, 4, 10, 0, 31, 32, 24, 26, 13, 16, 12, 11, 4, 1, 0, 1, 2, 2, 11, 8, 4, 1, 3, 2, 1, 2, 2, 0, 0, 6, 10, 3, 0, 0, 4, 4, 6, 2, 2, 0, 0, 12, 31, 8, 41, 82, 16, 15, 30,
+#> 66, 98, 3, 80, 63, 82, 5, 85, 55, 43, 29, 4, 34, 46, 59, 93, 106, 94, 89, 56, 41, 46, 49, 24, 7, 3, 21, 1, 1, 51, 69, 95, 84, 76, 108, 34, 0, 7, 47, 64, 18, 68, 82, 79, 95, 42, 26, 76, 70, 61, 29, 15, 31, 17, 17, 0, 4, 8, 1, 2, 5, 4, 8, 8, 4, 3, 1, 4, 2, 5, 5, 5, 9, 5, 4, 2, 1, 0, 1, 0, 56, 75, 93, 125, 80, 90, 85, 47, 44, 1, 2, 0, 1, 0, 0, 2, 5, 1, 1, 1, 6, 0, 0, 1, 3, 11, 6, 4, 3, 4, 1, 0, 10, 75, 22, 38, 126, 0, 39, 11, 19, 2, 49, 76, 71, 21, 66, 35, 23, 0, 73, 76, 89, 88, 77, 78, 72, 8, 47, 69,
+#> 71, 101, 90, 74, 67, 36, 49, 8, 0, 1, 51, 50, 67, 3, 75, 47, 97, 114, 92, 41, 11, 68, 15, 25, 44, 45, 7, 28, 0, 19, 32, 23, 47, 38, 37, 9, 3, 0, 42, 97, 95, 57, 69, 91, 50, 51, 79, 116, 53, 23, 37, 1, 0, 2, 3, 2, 5, 6, 10, 7, 3, 1, 4, 2, 1, 6, 0, 1, 1, 92, 32, 4, 128, 98, 97, 49, 90, 115, 88, 13, 5, 4, 41, 39, 20, 38, 25, 10, 30, 28, 26, 10, 21, 9, 7, 0, 70, 71, 86, 92, 92, 76, 90, 79, 73, 82, 80, 61, 22, 10, 1, 0, 6, 13, 11, 10, 9, 4, 3, 4, 8, 1, 0, 0, 58, 76, 87, 79, 81, 96, 132, 97, 94, 94, 108,
+#> 98, 99, 85, 33, 21, 81, 117, 110, 85, 75, 127, 126, 131, 113, 81, 0, 5, 100, 101, 78, 93, 86, 53, 83, 69, 47, 84, 33, 3, 41, 70, 59, 116, 92, 97, 80, 88, 84, 93, 74, 60, 64, 46, 62, 25, 20, 1, 0, 6, 2, 1, 1, 7, 6, 8, 5, 8, 6, 3, 3, 39, 109, 64, 57, 106, 77, 92, 109, 138, 90, 20, 24, 53, 36, 24, 16, 6, 19, 7, 1, 5, 0, 0, 2, 5, 3, 3, 7, 10, 1, 0, 0, 0, 63, 118, 104, 116, 112, 124, 90, 73, 27, 88, 56, 0, 1, 3, 8, 3, 5, 3, 6, 0, 0, 3, 2, 1, 0, 1, 3, 6, 10, 11, 7, 8, 10, 6, 4, 7, 8, 3, 10, 11, 10, 13,
+#> 3, 7, 2, 0, 1, 41, 63, 102, 72, 81, 38, 65, 5, 52, 51, 7, 6, 125, 108, 122, 99, 106, 104, 109, 62, 51, 61, 70, 81, 81, 83, 63, 82, 73, 30, 9, 23, 7, 15, 16, 37, 46, 28, 24, 20, 22, 1, 54, 42, 33, 8, 4, 0, 0, 9, 11, 20, 17, 21, 11, 14, 12, 11, 11, 8, 2, 1, 1, 5, 10, 7, 6, 5, 4, 4, 3, 0, 0, 14, 11, 17, 14, 27, 33, 55, 52, 54, 43, 13, 16, 38, 24, 9, 1, 1, 3, 3, 3, 4, 3, 1, 0, 0, 0, 1, 0, 0, 6, 5, 1, 0, 0, 85, 74, 79, 114, 92, 126, 98, 77, 19, 54, 80, 54, 7, 60, 16, 29, 3, 5, 5, 1, 3, 2, 1, 0, 0, 4,
+#> 47, 37, 31, 47, 73, 21, 48, 59, 22, 21, 10, 53, 35, 1, 6, 9, 7, 12, 4, 7, 1, 1, 4, 60, 49, 96, 99, 86, 46, 22, 61, 5, 33, 30, 65, 84, 5, 38, 45, 33, 0, 7, 0, 3, 0, 9, 48, 94, 98, 118, 87, 101, 106, 75, 86, 94, 68, 57, 22, 25, 15, 2, 4, 4, 50, 64, 57, 100, 87, 78, 96, 69, 67, 38, 19, 2, 32, 65, 70, 90, 73, 103, 43, 81, 39, 31, 8, 8, 11, 6, 18, 13, 8, 9, 2, 10, 0, 1, 84, 46, 10, 3, 37, 75, 74, 92, 99, 85, 55, 87, 76, 61, 46, 7, 5, 3, 1, 4, 8, 11, 5, 1, 0, 3, 0, 1, 0, 0, 0, 65, 79, 53, 78, 65, 110,
+#> 125, 87, 89, 54, 47, 19, 6, 54, 69, 48, 6, 1, 39, 12, 15, 23, 3, 101, 37, 13, 56, 61, 27, 55, 42, 24, 3, 18, 17, 4, 16, 1, 0, 0, 2, 2, 8, 5, 2, 3, 4, 6, 5, 0, 0, 0, 2, 0, 1, 0, 0, 0, 1, 3, 0, 0, 0, 0, 0, 29, 61, 55, 95, 99, 93, 52, 82, 56, 83, 66, 61, 54, 8, 1, 6, 22, 100, 109, 96, 80, 132, 120, 126, 112, 91, 45, 59, 38, 35, 28, 44, 16, 6, 4, 2, 6, 5, 7, 5, 1, 1, 6, 3, 0, 1, 42, 83, 78, 61, 74, 90, 83, 57, 42, 59, 18, 4, 10, 0, 100, 101, 79, 0, 3, 83, 106, 110, 84, 104, 92, 94, 91, 89, 57, 41, 1,
+#> 5, 72, 65, 82, 66, 79, 79, 87, 69, 44, 54, 59, 17, 119, 123, 101, 112, 121, 125, 107, 129, 130, 115, 121, 118, 99, 83, 84, 64, 94, 82, 27, 8, 24, 0, 3, 9, 5, 6, 3, 0, 1, 1, 0, 0, 0, 1, 0, 0, 4, 3, 2, 1, 4, 5, 8, 3, 2, 4, 1, 2, 4, 11, 13, 6, 2, 5, 2, 6, 1, 4, 1, 3, 0, 0, 0, 0, 0, 0, 4, 4, 18, 78, 59, 22, 85, 77, 89, 61, 98, 29, 11, 46, 27, 1, 0, 4, 9, 1, 0, 2, 0, 0, 1, 1, 0, 0, 3, 0, 0, 61, 94, 105, 129, 121, 132, 121, 127, 104, 119, 132, 96, 40, 92, 44, 40, 63, 57, 1, 2, 1, 8, 3, 14, 11, 12, 8, 5,
+#> 12, 6, 6, 1, 3, 7, 3, 1, 1, 1, 1, 6, 96, 65, 63, 26, 0, 10, 10, 32, 72, 8, 76, 33, 12, 56, 37, 34, 44, 1, 1, 0, 3, 100, 82, 101, 115, 76, 61, 64, 2, 94, 81, 101, 96, 74, 73, 99, 65, 60, 73, 61, 42, 11, 4, 0, 15, 125, 107, 110, 102, 89, 81, 91, 96, 74, 83, 77, 44, 54, 30, 89, 94, 91, 64, 102, 81, 88, 91, 107, 98, 68, 39, 22, 56, 35, 47, 0, 21, 9, 21, 0, 4, 0, 0, 0, 3, 5, 8, 3, 3, 4, 2, 0, 1, 1, 0, 0, 34, 18, 31, 22, 20, 20, 1, 3, 2, 2, 1, 2, 0, 2, 0, 0, 0, 0, 106, 86, 86, 86, 36, 93, 74, 79, 36, 41,
+#> 8, 6, 1, 49, 63, 76, 74, 62, 97, 104, 116, 91, 12, 29, 11, 11, 20, 32, 3, 39, 76, 102, 85, 112, 83, 74, 60, 54, 1, 7, 29, 0, 0, 1, 7, 6, 8, 7, 8, 9, 4, 2, 4, 0, 1, 1, 0, NA, 0, 0, 0, 0, 0, 5, 7, 9, 6, 5, 4, 3, 3, 6, 6, 0, 1, 5, 0, 1, 0, 5, 11, 1, 1, 1, 2, 0, 0, 58, 67, 10, 59, 75, 67, 60, 81, 82, 58, 59, 58, 1, 2, 0, 42, 45, 93, 76, 92, 111, 100, 109, 110, 82, 84, 85, 67, 79, 54, 45, 3, 80, 110, 96, 108, 103, 109, 97, 118, 108, 103, 106, 82, 83, 77, 72, 14, 39, 4, 9, 42, 121, 96, 83, 84, 86, 77,
+#> 116, 78, 89, 77, 72, 85, 94, 49, 74, 64, 69, 46, 40, 71, 2, 10, 7, 9, 9, 4, 10, 6, 4, 11, 5, 5, 5, 4, 0, 0, 3, 70, 98, 82, 113, 119, 97, 94, 75, 87, 41, 67, 79, 52, 68, 71, 60, 25, 4, 11, 6, 4, 10, 6, 9, 8, 3, 2, 2, 3, 1, 0, 0, 0, 0, 0, 69, 82, 76, 98, 86, 90, 72, 73, 93, 67, 97, 55, 55, 77, 86, 56, 47, 56, 122, 97, 90, 106, 86, 117, 134, 79, 103, 109, 122, 83, 69, 111, 88, 82, 41, 85, 75, 6, 19, 5, 78, 91, 79, 101, 86, 95, 109, 92, 86, 100, 71, 62, 17, 17, 0, 20, 0, 58, 105, 106, 118, 109, 116,
+#> 102, 115, 127, 121, 103, 109, 117, 113, 84, 100, 103, 95, 75, 84, 47, 45, 22, 0, 5, 7, 10, 10, 11, 4, 4, 5, 6, 7, 10, 3, 4, 3, 3, 2, 0, 0, 0, 1, 4, 3, 10, 9, 11, 11, 14, 11, 10, 6, 2, 0, 6, 0, 0, 3, 0, 0, 2, 15, 82, 76, 90, 60, 74, 74, 66, 62, 40, 6, 7, 4, 0, 28, 55, 44, 35, 46, 31, 67, 55, 33, 53, 63, 43, 38, 17, 4, 2, 109, 3, 96, 104, 119, 79, 106, 96, 94, 92, 89, 91, 14, 38, 4, 0, 0, 21, 60, 51, 86, 50, 51, 50, 48, 38, 42, 42, 66, 35, 1, 30, 44, 24, 56, 66, 67, 77, 84, 28, 72, 46, 26, 0, 3, 3,
+#> 6, 8, 13, 5, 9, 3, 0, 0, 1, 0, 0, 0, 4, 10, 7, 7, 2, 6, 9, 4, 4, 6, 10, 8, 0, 0, 3, 1, 1, 33, 35, 33, 45, 59, 29, 64, 63, 75, 63, 38, 38, 9, 13, 22, 0, 2, 8, 7, 5, 4, 8, 3, 4, 1, 0, 0, 2, 36, 91, 77, 48, 63, 35, 102, 69, 64, 80, 65, 17, 6, 1, 11, 46, 53, 72, 91, 56, 64, 86, 45, 73, 35, 55, 16, 4, 28, 76, 77, 68, 91, 103, 55, 42, 70, 81, 38, 4, 13, 9, 28, 10, 14, 0, 27, 79, 52, 69, 68, 114, 80, 92, 44, 29, 2, 6, 0, 30, 59, 69, 50, 58, 71, 55, 43, 66, 52, 56, 62, 36, 13, 29, 17, 3, 21, 21, 55, 60,
+#> 61, 37, 45, 50, 65, 81, 3, 35, 18, 12, 11, 10, 3, 21, 16, 10, 6, 1, 6, 11, 3, 7, 2, 9, 0, 0, 0, 13, 30, 3, 80, 87, 92, 95, 80, 82, 83, 101, 64, 63, 22, 9, 17, 92, 115, 92, 34, 41, 0, 88, 92, 81, 105, 105, 100, 75, 1, 5, 65, 91, 71, 74, 87, 31, 6, 0, 51, 3, 21, 1, 68, 81, 72, 69, 72, 89, 41, 54, 7, 58, 69, 34, 19, 20, 7, 3, 7, 0, 1, 2, 4, 6, 3, 7, 5, 3, 4, 5, 6, 3, 2, 2, 2, 0, 1, 0, 3, 1, 2, 0, 1, 0, 0, 0, 0, 0, 0, 0, 1, 4, 6, 4, 4, 6, 9, 3, 12, 8, 5, 11, 10, 8, 5, 4, 7, 11, 8, 4, 5, 1, 22, 62, 87,
+#> 103, 60, 40, 59, 2, 26, 45, 9, 7, 63, 73, 93, 76, 49, 66, 35, 16, 7, 1, 1, 83, 79, 83, 102, 99, 90, 71, 34, 73, 63, 18, 15, 32, 37, 59, 41, 103, 55, 93, 85, 73, 81, 101, 98, 45, 30, 52, 53, 43, 0, 20, 54, 32, 34, 8, 0, 0, 2, 3, 2, 2, 3, 3, 0, 1, 0, 0, 0, 5, 10, 8, 3, 3, 11, 6, 10, 0, 6, 2, 9, 9, 11, 3, 0, 5, 13, 31, 29, 74, 89, 77, 67, 82, 81, 91, 88, 65, 73, 84, 67, 48, 53, 46, 50, 16, 3, 1, 1, 12, 24, 9, 49, 70, 58, 64, 33, 36, 30, 6, 38, 72, 78, 89, 87, 82, 56, 30, 46, 23, 1, 4, 19, 61, 26, 61,
+#> 69, 98, 132, 92, 53, 86, 22, 37, 64, 25, 63, 5, 77, 81, 89, 93, 106, 92, 82, 85, 29, 34, 7, 38, 45, 40, 58, 67, 74, 85, 71, 76, 85, 70, 55, 58, 3, 4, 1, 0, 72, 51, 12, 55, 85, 61, 3, 35, 7, 28, 15, 13, 6, 2, 3, 2, 54, 36, 80, 58, 60, 53, 52, 71, 79, 111, 90, 60, 1, 28, 26, 37, 46, 78, 54, 61, 39, 63, 76, 63, 19, 19, 28, 63, 27, 8, 0, 3, 7, 3, 5, 6, 2, 1, 0, 2, 1, 2, 2, 6, 2, 0, 1, 3, 2, 0, 2, 2, 1, 0, 1, 0, 1, 7, 0, 2, 0, 1, 1, 1, 0, 0, 1, 0, 1, 0, 1, 2, 0, 1, 0, NA, 0, 2, 4, 3, 0, 0, 0, 0, 2, 1,
+#> 36, 18, 53, 45, 80, 99, 72, 90, 76, 71, 0, 4, 14, 4, 6, 7, 11, 13, 3, 2, 0, 0, 1, 0, 3, 6, 52, 39, 22, 59, 45, 50, 42, 42, 47, 37, 31, 33, 7, 48, 66, 42, 69, 60, 89, 100, 95, 77, 95, 91, 105, 103, 74, 87, 65, 82, 68, 20, 131, 107, 101, 107, 96, 99, 97, 70, 90, 60, 58, 74, 60, 56, 56, 46, 38, 27, 75, 105, 130, 83, 81, 92, 60, 92, 76, 57, 23, 77, 73, 16, 5, 5, 3, 1, 1, 0, 1, 0, 0, 4, 75, 94, 87, 100, 115, 100, 92, 91, 103, 137, 86, 95, 72, 55, 68, 36, 2, 16, 64, 119, 94, 67, 63, 79, 98, 64, 50, 81,
+#> 58, 72, 51, 51, 17, 3, 55, 66, 80, 90, 67, 129, 90, 91, 89, 92, 68, 20, 10, 8, 13, 4, 21, 49, 31, 41, 67, 4, 28, 29, 28, 41, 33, 37, 38, 20, 1, 9, 2, 0, 2, 0, 0, 0, 0, 0, 0, 2, 3, 7, 0, 0, 3, 0, 2, 2, 0, 1, 0, 0, 2, 0, 0, 0, 4, 1, 7, 0, 2, 4, 1, 1, 2, 2, 1, 0, 1, 2, 0, 0, 31, 20, 12, 74, 96, 73, 94, 91, 70, 56, 14, 5, 0, 0, 1, 0, 3, 0, 0, 1, 3, 6, 2, 2, 2, 2, 0, 0, 4, 7, 9, 9, 3, 9, 9, 5, 10, 18, 6, 2, 4, 1, 0, 0, 10, 9, 2, 11, 6, 12, 7, 7, 8, 17, 6, 3, NA, 1, 0, NA, 4, 4, 4, NA, 0, NA, 4, 2, 0,
+#> 0, 4, 90, 54, 70, 65, 43, 64, 83, 40, 24, 29, 42, 42, 27, 20, 3, 1, 94, 91, 75, 94, 76, 45, 60, 46, 13, 1, 1, 0, 0, 10, 10, 8, 5, 4, 3, 6, 8, 4, 7, 0, 0, 43, 60, 120, 69, 70, 3, 27, 72, 30, 2, 52, 4, 24, 17, 26, 9, 3, 53, 67, 43, 16, 1, 2, 1, 0, 3, 9, 8, 6, 6, 9, 3, 3, 3, 0, 0, 0, 2, 4, 0, 0, 0, 0, 0, 0, 1, 1, 2, 1, 0, 0, 3, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 2, 3, 1, 3, 1, 3, 3, 4, 5, 71, 99, 91, 77, 78, 81, 112, 90, 96, 125, 75, 70, 82, 93, 91, 71, 99, 70, 69, 49, 36, 53, 38, 4, 2, 65, 69,
+#> 74, 94, 126, 73, 63, 29, 21, 9, 21, 14, 47, 46, 47, 47, 24, 10, 14, 52, 46, 18, 33, 24, 8, 0, 2, 50, 24, 37, 53, 99, 112, 97, 90, 64, 68, 71, 80, 4, 1, 30, 29, 28, 31, 8, 27, 5, 23, 40, 25, 2, 0, 0, 1, 0, 12, 9, 2, 12, 10, 10, 9, 12, 7, 2, 101, 64, 117, 97, 86, 94, 120, 120, 86, 107, 115, 110, 112, 130, 95, 103, 90, 95, 73, 80, 52, 9, 34, 60, 15, 14, 79, 71, 51, 85, 45, 41, 49, 38, 44, 50, 23, 0, 16, 3, 3, 13, 6, 4, 2, 10, 5, 8, 3, 5, 4, 3, 4, NA, 0, 10, 12, 36, 74, 107, 96, 101, 93, 93, 62, 46,
+#> 66, 65, 27, 28, 10, 1, 4, 4, 11, 12, 8, 14, 11, 7, 3, 11, 14, 5, 12, 8, 6, 1, 0, 1, 5, 3, 3, 1, 2, 0, 1, 1, 0, 0, 44, 64, 67, 42, 47, 34, 15, 10, 15, 29, 48, 59, 5, 9, 0, 3, 15, 2, 1, 44, 84, 44, 79, 94, 88, 93, 107, 86, 97, 83, 77, 68, 65, 29, 8, 25, 34, 24, 25, 31, 26, 0, 31, 3, 4, 3, 0, 109, 107, 99, 76, 54, 97, 96, 73, 1, 63, 43, 46, 3, 6, 125, 93, 112, 89, 87, 79, 88, 82, 90, 39, 84, 54, 52, 19, 38, 64, 48, 83, 52, 81, 73, 53, 4, 7, 3, 1, 12, 10, 4, 2, 98, 84, 94, 85, 88, 95, 78, 89, 105, 40,
+#> 106, 96, 61, 53, 29, 28, 25, 7, 15, 83, 86, 66, 78, 75, 77, 78, 95, 31, 31, 7, 25, 31, 25, 17, 10, 4, 3, 64, 59, 21, 63, 44, 79, 72, 70, 89, 56, 61, 66, 1, 0, 40, 23, 57, 87, 68, 83, 67, 45, 72, 89, 97, 71, 67, 59, 33, 36, 2, 2, 4, 4, 1, 2, 3, 0, 5, 0, 0, 0, 0, 1, 37, 69, 45, 47, 66, 73, 61, 44, 57, 51, 33, 58, 42, 22, 13, 23, 77, 42, 61, 65, 59, 30, 45, 67, 67, 59, 25, 9, 5, 15, 72, 73, 69, 50, 66, 34, 4, 15, 1, 10, 57, 69, 51, 23, 29, 33, 40, 11, 20, 44, 29, 49, 59, 24, 15, 2, 0, 88, 61, 81, 52,
+#> 54, 15, 4, 1, 1, 21, 7, 2, 4, 5, 8, 8, 4, 11, 3, 8, 13, 5, 6, 1, 1, 1, 0, 0, 1, 1, 2, 8, 8, 5, 4, 9, 8, 6, 3, NA, 1, 0, 31, 1, 1, 63, 92, 75, 39, 29, 51, 66, 74, 19, 61, 3, 0, 14, 16, 2, 66, 3, 1, 34, 53, 68, 84, 54, 57, 89, 70, 104, 75, 106, 90, 71, 54, 29, 60, 60, 28, 2, 6, 0, 1, 0, 2, 2, 0, 3, 0, 0, 1, 0, 0, 1, 0, 1, 0, NA, 0, 1, 1, 3, 1, 1, 0, 1, 0, 0, 0, 2, 1, 0, 1, 0, 0, 0, 42, 47, 54, 51, 48, 5, 34, 34, 14, 8, 0, 3, 0, 2, 98, 73, 30, 97, 107, 58, 52, 30, 8, 3, 30, 47, 88, 59, 48, 28, 46, 38,
+#> 30, 25, 0, 4, 72, 40, 35, 38, 42, 40, 45, 44, 32, 7, 10, 5, 0, 0, 44, 67, 74, 54, 78, 53, 60, 83, 82, 59, 53, 52, 37, 64, 29, 0, 2, 45, 47, 19, 26, 25, 19, 8, 18, 5, 0, 3, 8, 5, 19, 13, 7, 13, 8, 9, 6, 2, 2, 21, 38, 48, 59, 96, 75, 60, 80, 122, 76, 72, 54, 70, 52, 0, 33, 4, 25, 0, 0, 0, 1, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 4, 4, 5, 3, 1, 2, 0, 3, 0, 0, 1, 0, 0, 0, 1, 40, 25, 78, 93, 103, 107, 72, 64, 73, 81, 74, 77, 71, 63, 58, 73, 35, 18, 18, 9, 25, 14, 1, 73, 79, 30, 81, 107, 94, 113, 92, 97,
+#> 114, 126, 81, 110, 105, 78, 73, 69, 31, 56, 4, 5, 7, 4, 1, 2, 2, 1, 2, 3, 2, 5, 1, 2, 0, 0, 1, 4, 3, 4, 3, 3, 5, 0, 2, 5, 8, 4, 6, 1, 5, 0, 73, 74, 23, 63, 50, 72, 71, 98, 74, 86, 73, 103, 51, 18, 19, 9, 0, 49, 35, 72, 48, 102, 79, 75, 47, 73, 77, 51, 29, 20, 10, 7, 0, 2, 29, 80, 67, 56, 42, 76, 84, 69, 45, 1, 0, 50, 68, 41, 67, 13, 1, 23, 35, 2, 7, 3, 0, 66, 46, 79, 27, 88, 61, 98, 86, 89, 97, 128, 85, 78, 74, 57, 88, 66, 42, 69, 5, 5, 7, 9, 8, 5, 9, 3, 7, 5, 10, 1, 5, 3, 5, 3, 3, 6, 0, 0, NA, NA,
+#> 3, 3, 5, 39, 53, 48, 50, 68, 35, 46, 16, 51, 19, 14, 30, 3, 13, 1, 6, 26, 28, 18, 13, 2, 31, 19, 90, 62, 102, 85, 113, 82, 38, 117, 90, 104, 80, 75, 10, 7, 0, 6, 0, 5, 4, 6, 4, 13, 8, 2, 1, NA, NA, NA, 0, 0, NA, NA, 2, 3, 0, 0, 0, 3, 9, 3, 12, 4, 5, 6, 4, 9, 3, NA, NA, NA, 5, 0, 0, 1, 2, 2, 10, 3, 7, 5, 2, 0, 0, 0, 1, 78, 78, 87, 109, 85, 75, 79, 79, 67, 35, 20, 104, 82, 41, 47, 5, 51, 3, 14, 28, 38, 88, 73, 83, 43, 45, 81, 40, 26, 34, 30, 15, 73, 73, 91, 98, 69, 99, 80, 51, 38, 11, 2, 7, 67, 83,
+#> 97, 80, 87, 83, 108, 83, 62, 67, 52, 73, 52, 14, 44, 32, 20, 12, 4, 10, 25, 37, 51, 27, 35, 31, 2, 22, 0, 19, 3, 3, 1, 0, 4, 1, 3, 6, 5, 0, NA, 0, 0, 0, 0, NA, 0, 2, 1, 0, NA, 0, 16, 15, 61, 24, 25, 9, 23, 10, 79, 6, 83, 3, 20, 6, 6, 69, 72, 47, 68, 66, 53, 64, 44, 42, 32, 62, 40, 0, 55, 15, 11, 12, 77, 32, 0, 1, 4, 1, 6, 1, 10, 4, 14, 3, 4, NA, NA, 1, 1, 19, 50, 61, 63, 109, 100, 77, 77, 52, 83, 77, 55, 12, 14, 35, 14, 0, 0, 0, 0, 0, 0, 0, 0, 0, 2, 1, 8, NA, 0, 0, NA, NA, NA, 2, 41, 36, 29, 20,
+#> 9, 15, 20, 20, 3, 0, 0, 0, 4, 6, 3, 6, 6, 7, 5, NA, NA, NA, NA, NA, 5, 47, 62, 50, 52, 68, 67, 31, 84, 56, 0, 23, 5, 14, 1, 2, 19, 40, 76, 53, 67, 36, 60, 54, 44, 66, 39, 39, 28, 37, 9, 6, 20, 13, 49, 98, 100, 65, 46, 82, 50, 81, 55, 40, 3, 15, 0, 4, 54, 61, 85, 59, 43, 69, 59, 63, 19, 57, 44, 10, 0, 1, 43, 54, 43, 65, 53, 71, 7, 36, 47, 67, 49, 39, 16, 33, 19, 8, 69, 40, 53, 53, 69, 68, 56, 18, 64, 38, 12, 36, 1, 13, 82, 123, 57, 87, 72, 99, 90, 91, 84, 93, 82, 78, 94, 33, 92, 43, 67, 64, 65, 42,
+#> 0, 38, 58, 53, 41, 92, 82, 82, 62, 44, 53, 31, 17, 0, 0, 5, 6, 5, 4, 5, 6, 6, 7, 8, 5, 7, 7, 9, 7, 5, 8, 9, 8, 2, NA, 3, 1, NA, NA, NA, 1, 38, 28, 4, 28, 37, 86, 87, 59, 105, 97, 85, 11, 46, 59, 1, 8, 1, 2, 74, 46, 63, 92, 71, 63, 39, 48, 62, 2, 2, 2, 0, 1, 1, 0, 1, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, NA, 0, NA, 0, 0, 7, 39, 65, 53, 89, 80, 46, 63, 14, 31, 65, 29, 13, 5, 7, 4, 8, 0, 5, 0, 3, 5, 2, 4, 8, 9, 10, 3, NA, NA, NA, 0, 2, 39, 61, 50, 13, 10, 35, 36, 50, 53, 56, 12, 60, 38, 6, 14, 6,
+#> 0, 0, 11, 62, 53, 42, 37, 20, 14, 26, 25, 3, 6, 2, 2, 4, 51, 50, 49, 49, 25, 45, 29, 41, 48, 21, 6, 24, 42, 62, 90, 51, 70, 79, 61, 41, 45, 19, 47, 69, 82, 77, 59, 57, 89, 23, 8, 6, 59, 71, 54, 80, 64, 83, 79, 85, 73, 42, 0, 6, 7, 5, 7, 8, 9, 2, 0, 1, 1, 2, 5, 2, 5, 5, 3, 5, 1, 3, NA, 1, NA, 0, 1, 2, 4, 1, 6, 7, 0, 0, NA, NA, NA, 8, 10, 35, 28, 104, 112, 88, 42, 45, 58, 32, 1, 7, 2, 1, 1, 6, 4, 0, 0, NA, NA, 0, 8, 7, 3, 4, NA, NA, 0, 3, 6, 6, 91, 80, 75, 89, 87, 87, 93, 85, 74, 100, 56, 49, 73, 35,
+#> 6, 55, 120, 134, 110, 118, 131, 97, 93, 48, 103, 8, 85, 93, 37, 26, 12, 56, 103, 60, 91, 52, 74, 65, 86, 66, 92, 84, 81, 82, 86, 41, 16, 61, 9, 3, 20, 59, 38, 42, 72, 55, 54, 35, 48, 5, 34, 25, 16, 7, 26, 49, 51, 70, 8, 38, 66, 79, 90, 81, 61, 83, 44, 57, 59, 47, 16, 13, 0, 4, 64, 72, 58, 47, 42, 18, 17, 39, 9, 18, 58, 78, 77, 60, 53, 35, 36, 2, 56, 49, 78, 52, 34, 11, 8, 2, 3, 82, 95, 94, 102, 83, 69, 80, 73, 90, 66, 22, 42, 41, 14, 12, 2, 10, 27, 60, 81, 40, 59, 30, 24, 16, 23, 16, 7, 0, 2, 11,
+#> 2, 5, 13, 7, 12, NA, NA, NA, NA, NA, NA, NA, 0, NA, NA, NA, NA, 1, 14, 54, 78, 85, 78, 85, 87, 65, 59, 67, 61, 75, 56, 59, 20, 3, 12, 6, 62, 63, 60, 55, 64, 77, 60, 52, 42, 15, 8, 2, 0, 2, 0, 0, 3, 1, 0, NA, NA, NA, NA, 0, NA, 0, 3, 1, 2, 5, 8, 4, 1, 1, 1, 0, 1, 0, 2, 0, 0, 0, 5, 4, 100, 60, 73, 6, 94, 102, 87, 122, 116, 107, 107, 113, 113, 68, 70, 66, 47, 68, 72, 50, 1, 19, 26, 22, 83, 71, 83, 64, 66, 60, 61, 46, 26, 18, 7, 0, 1, 0, 4, 4, 2, 3, 5, 7, 5, 5, NA, NA, 0, NA, NA, NA, 5, 2, NA, NA, 5,
+#> NA, NA, 0, 2, 51, 43, 43, 35, 21, 14, 0, 0, 7, 74, 65, 36, 47, 76, 106, 94, 49, 73, 44, 66, 85, 54, 85, 42, 68, 37, 47, 65, 42, 12, 2, 0, 8, 44, 54, 35, 42, 21, 12, 71, 63, 40, 42, 55, 55, 2, 6, 0, 46, 85, 103, 86, 95, 93, 89, 92, 31, 57, 71, 42, 52, 40, 59, 24, 14, 5, 50, 74, 67, 42, 97, 79, 71, 93, 78, 74, 57, 34, 50, 73, 33, 13, 2, 1, 6, 5, 3, 6, 10, 1, NA, NA, NA, NA, NA, NA, 4, 10, 10, 40, 62, 94, 53, 73, 66, 54, 48, 58, 35, 42, 14, 21, 1, 8, 3, 13, 5, 60, 28, 5, 1, 7, 0, 74, 74, 58, 55, 60,
+#> 51, 58, 1, 47, 31, 35, 33, 41, 31, 2, 1, 9, 16, 21, 39, 26, 7, 1, 0, 0, 2, 1, 2, NA, 0, NA, 0, 0, NA, 0, 0, NA, 2, NA, 0, 0, 0, 2, 0, 0, 2, 6, 1, 0, 2, 2, 1, 1, NA, NA, 0, 0, 27, 67, 82, 85, 87, 71, 97, 80, 85, 89, 77, 69, 67, 77, 30, 27, 2, 32, 11, 19, 11, 7, 66, 82, 92, 81, 93, 24, 68, 78, 60, 56, 74, 65, 60, 74, 42, 0, 15, 16, 48, 49, 45, 58, 36, 3, 18, 20, 21, 43, 8, 16, 5, 5, 4, 5, 14, 0, 64, 84, 67, 66, 54, 37, 24, 11, 17, 24, 5, 0, 0, 0, 1, 1, 0, 0, NA, NA, NA, 0, NA, NA, NA, NA, 5, 73, 35,
+#> 47, 71, 74, 21, 80, 118, 61, 77, 63, 47, 6, 11, 74, 87, 67, 79, 89, 75, 97, 79, 62, 89, 66, 101, 45, 49, 3, 10, 0, 0, 23, 16, 65, 87, 63, 95, 76, 73, 51, 61, 62, 34, 20, 7, 1, 11, 67, 106, 93, 75, 64, 97, 84, 64, 75, 65, 85, 57, 28, 10, 0, 2, 4, 4, 5, 6, 4, 6, 0, 0, 0, NA, NA, NA, 2, NA, 2, 3, 4, 42, 67, 114, 99, 82, 11, 42, 64, 82, 68, 69, 51, 64, 94, 60, 81, 78, 90, 48, 31, 0, 3, 0, 7, 5, 11, 1, 0, 35, 30, 29, 47, 55, 61, 24, 53, 84, 72, 72, 38, 20, 64, 47, 25, 19, 21, 2, 2, 0, 0, 3, 0, 1, 2, 0,
+#> 0, 1, 0, NA, 0, 0, 0, 0, 0, 8, 27, 36, 37, 95, 85, 85, 91, 89, 92, 78, 63, 66, 76, 72, 80, 58, 5, 5, 48, 64, 58, 26, 19, 61, 34, 58, 1, 33, 20, 3, 5, 9, 9, 5, 10, 14, 5, 0, 0, NA, 0, NA, NA, NA, 8, 5, 13, 32, 35, 73, 69, 59, 54, 28, 38, 16, 14, 14, 2, 1, 5, 4, 8, 2, 3, 12, 8, 3, 2, NA, 1, 38, 24, 40, 39, 70, 62, 74, 59, 75, 91, 72, 57, 48, 54, 46, 59, 42, 32, 11, 25, 10, 54, 29, 25, 25, 9, 12, 1, 20, 4, 71, 84, 81, 71, 91, 72, 49, 35, 32, 42, 43, 5, 19, 57, 82, 80, 98, 63, 60, 15, 86, 43, 67, 57,
+#> 44, 31, 8, 81, 70, 40, 55, 21, 68, 82, 68, 26, 8, 21, 2, 43, 108, 93, 112, 114, 93, 109, 104, 78, 108, 104, 93, 89, 97, 88, 52, 19, 3, 3, 7, 6, 8, 5, 2, NA, NA, 2, 4, 44, 75, 69, 91, 78, 68, 69, 48, 42, 61, 30, 1, 1, 0, 0, NA, NA, 2, 1, 0, 0, 0, 0, 1, 1, 0, 0, 0, 2, 1, 4, 2, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, NA, NA, 16, 65, 77, 68, 70, 76, 48, 37, 62, 35, 92, 68, 38, 20, 49, 38, 56, 5, 3, 2, 0, 9, 4, 8, 7, 0, 3, NA, 0, 0, 0, NA, NA, NA, NA, 0, NA, 5, 103, 76, 81, 75, 116, 67, 28, 89, 56, 84, 59, 67,
+#> 49, 37, 9, 44, 18, 5, 40, 48, 43, 40, 58, 41, 42, 39, 10, 0, 62, 81, 74, 50, 4, 75, 85, 62, 70, 59, 37, 39, 27, 29, 22, 1, 1, 5, 5, 4, 3, 5, 0, 10, 1, 1, 1, 5, 4, 3, 1, 2, 3, 1, 1, 2, NA, 1, NA, NA, NA, 0, 13, 27, 81, 78, 65, 65, 74, 71, 88, 99, 81, 71, 52, 46, 47, 56, 56, 66, 36, 16, 5, 6, 92, 75, 104, 121, 117, 81, 51, 86, 90, 98, 85, 98, 66, 57, 22, 4, 45, 47, 64, 79, 81, 64, 90, 56, 99, 100, 64, 100, 81, 40, 65, 36, 2, 4, 7, 6, 2, 6, 8, 1, 0, 1, 0, 13, 66, 76, 29, 85, 74, 99, 85, 47, 44, 55,
+#> 87, 73, 47, 1, 55, 63, 69, 88, 90, 96, 90, 62, 75, 65, 69, 96, 53, 90, 70, 9, 27, 1, 20, 17, 27, 75, 82, 107, 102, 109, 71, 29, 41, 68, 73, 88, 89, 77, 43, 56, 71, 45, 2, 0, 0, NA, NA, NA, 0, NA, NA, 0, NA, NA, NA, 0, 1, 0, 0, 0, NA, 0, NA, NA, 0, 0, 0, 0, 0, 0, 2, 2, 0, 0, NA, NA, 0, 0, 0, 1, 2, 39, 11, 15, 6, 31, 71, 86, 124, 97, 68, 79, 64, 64, 74, 67, 57, 2, 28, 14, 14, 47, 6, 64, 68, 65, 46, 54, 47, 40, 30, 40, 27, 14, 7, 4, 24, 0, 1, 45, 45, 33, 61, 54, 50, 59, 42, 37, 30, 43, 38, 41, 9, 8,
+#> 13, 13, 2, 46, 60, 61, 61, 39, 75, 69, 72, 84, 122, 74, 121, 110, 86, 109, 96, 82, 66, 35, 69, 73, 33, 65, 67, 55, 47, 71, 20, 40, 53, 19, 31, 21, 0, 3, 4, 6, 0, 3, 6, 4, 3, 3, 3, 0, 3, 3, 2, 0, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 4, 4, 3, 6, 6, 4, 4, 6, 7, 4, 2, 3, 1, 2, 3, 1, 3, NA, NA, NA, NA, NA, NA, NA, 1, NA, NA, 0, 0, NA, NA, NA, NA, NA, 0, 0, 0, 2, 0, 0, 0, 0, 0, 0, 0, NA, 0, 0, NA, 0, NA, NA, NA, NA, 0, 0, 0, 1, 0, 0, 0, 1, 0, 0, 4, 0, 0, 1, 3, 0, 0, 0, 2, 49, 84, 94, 105, 79,
+#> 119, 87, 42, 101, 90, 42, 108, 70, 71, 90, 67, 82, 77, 55, 69, 1, 18, 39, 9, 36, 71, 58, 75, 104, 90, 55, 73, 38, 91, 84, 30, 41, 22, 5, NA, NA, 0, 0, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 0, 0, NA, 3, 6, 31, 18, 26, 69, 70, 95, 79, 78, 37, 35, 96, 62, 6, 37, 40, 2, 3, 78, 60, 69, 55, 9, 52, 52, 22, 70, 66, 36, 19, 1, 39, 6, 2, 0, 4, 4, 42, 41, 28, 40, 55, 48, 38, 34, 19, 42, 46, 33, 37, 48, 42, 38, 33, 11, 19, 24, 95, 111, 117, 90, 62, 89, 65, 70, 60, 44, 68, 36, 33, 65, 21,
+#> 5, 26, 6, 13, 10, 20, 19, 43, 39, 59, 66, 73, 70, 35, 71, 52, 58, 62, 76, 67, 48, 34, 20, 8, 10, 60, 43, 49, 56, 61, 19, 26, 18, 25, 44, 60, 54, 48, 14, 6, 9, 28, 44, 71, 98, 63, 69, 11, 58, 27, 72, 39, 60, 59, 5, 0, 0, 3, 2, 62, 101, 80, 63, 36, 86, 62, 86, 80, 48, 80, 71, 31, 48, 25, 81, 85, 90, 100, 57, 87, 115, 97, 111, 61, 89, 75, 66, 96, 69, 64, 77, 57, 68, 36, 33, 13, 0, 9, 64, 84, 90, 96, 71, 107, 104, 73, 65, 65, 90, 78, 62, 72, 69, 60, 44, 34, 30, 6, 9, 59, 91, 87, 98, 99, 59, 85, 73, 86,
+#> 75, 76, 96, 43, 62, 15, 37, 60, 29, 1, 75, 52, 7, 88, 68, 37, 81, 95, 96, 18, 16, 11, 7, 0, 2, 3, 2, 4, 4, 0, NA, NA, NA, NA, NA, NA, 5, 3, 5, 3, 3, 2, 1, 2, 1, NA, NA, NA, NA, NA, 36, 66, 75, 80, 75, 93, 89, 53, 4, 22, 2, 35, 26, 0, 0, 29, 64, 70, 62, 66, 80, 60, 82, 71, 68, 84, 45, 73, 76, 44, 60, 14, 20, 6, 3, 3, 4, 3, 9, 9, 5, 8, 4, 1, NA, 0, 2, 8, 7, 7, 1, 4, 2, 2, 0, 32, 94, 82, 105, 83, 47, 76, 39, 40, 63, 42, 42, 35, 43, 45, 20, 5, 17, 55, 52, 44, 54, 40, 47, 57, 20, 11, 16, 36, 2, 0, 0,
+#> 3, 1, 0, 0, NA, NA, 0, 0, NA, NA, NA, 0, 9, 13, 65, 41, 21, 40, 34, 66, 60, 52, 38, 50, 41, 17, 5, 3, 20, 54, 90, 90, 116, 111, 65, 79, 43, 34, 83, 87, 94, 87, 43, 18, 7, 6, 77, 95, 108, 72, 85, 93, 109, 79, 35, 58, 64, 5, 32, 52, 38, 11, 4, 2, 36, 63, 75, 73, 40, 8, 15, 33, 30, 5, 0, 0, 0, 4, 3, 11, 5, 3, 7, 3, 5, 5, 5, 2, 5, 10, 2, 1, 6, 3, NA, NA, NA, 0, NA, NA, 5, 71, 75, 68, 48, 76, 94, 90, 102, 95, 110, 54, 77, 75, 94, 77, 72, 67, 36, 50, 66, 81, 42, 85, 75, 15, 61, 70, 15, 43, 26, 43, 60,
+#> 71, 54, 89, 98, 94, 32, 77, 65, 93, 73, 84, 75, 32, 9, 42, 9, 11, 5, 2, 2, 48, 67, 59, 66, 66, 72, 121, 50, 129, 102, 105, 76, 82, 99, 92, 101, 98, 66, 71, 62, 3, 14, 64, 90, 84, 77, 60, 90, 82, 33, 71, 34, 93, 81, 76, 59, 75, 32, NA, NA, NA, NA, NA, 0, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 0, NA, 0, 4, 1, 0, 0, 0, 1, 0, 0, 0, 0, 0, 9, 0, 12, 55, 49, 66, 86, 60, 83, 96, 70, 104, 106, 63, 82, 46, 25, 49, 86, 51, 66, 75, 64, 71, 89, 76, 44, 62, 75, 88, 28, 33, 89, 74, 3, 24, 4, 5, 55, 53, 50,
+#> 62, 84, 51, 26, 73, 8, 41, 36, 16, 0, 3, 55, 42, 51, 53, 40, 68, 37, 52, 33, 16, 45, 36, 22, 27, 15, 3, 9, 57, 74, 81, 104, 88, 97, 89, 52, 84, 99, 106, 105, 90, 83, 96, 63, 7, 75, 92, 72, 35, 11, 4, 0, 33, 64, 66, 79, 85, 87, 103, 120, 39, 52, 80, 82, 84, 70, 93, 64, 3, 28, 3, 41, 70, 8, 20, 77, 97, 89, 22, 90, 78, 91, 49, 49, 8, NA, NA, NA, NA, 0, 0, NA, NA, NA, 0, NA, NA, 0, NA, NA, 49, 67, 41, 48, 83, 5, 0, 5, 1, 81, 63, 30, 57, 62, 53, 75, 74, 69, 39, 49, 38, 27, 21, 15, 0, 0, 6, 1, 2, NA, NA,
+#> 3, NA, 4, 3, 8, 8, 5, 0, 2, NA, NA, 0, 4, 2, 50, 59, 66, 43, 61, 77, 101, 51, 22, 46, 57, 56, 30, 21, 19, 22, 34, 77, 100, 68, 88, 62, 90, 67, 93, 85, 48, 71, 52, 28, 22, 46, 15, 93, 80, 94, 64, 24, 2, 55, 70, 15, 17, 57, 59, 32, 17, 65, 54, 41, 65, 70, 4, 5, 22, 16, 65, 97, 31, 40, 80, 25, 68, 66, 70, 1, 24, 69, 95, 110, 87, 62, 82, 48, 17, 37, 9, 12, 46, 5, 2, 0, 1, 8, 5, 2, 0, 0, 1, 1, 2, 6, 1, 7, 1, 2, 1, 4, 6, NA, NA, NA, NA, NA, 0, 3, 1, 1, 1, 3, 1, 0, 2, 0, 1, 1, 0, 0, 0, 0, 0, 0, 0, 1, 2,
+#> 0, 2, 3, 1, NA, NA, NA, 0, NA, 15, 57, 86, 58, 84, 55, 93, 77, 50, 39, 14, 20, 0, 10, 43, 113, 133, 54, 87, 90, 81, 87, 77, 97, 81, 58, 49, 38, 38, 29, 4, 0, NA, 0, 0, NA, NA, NA, 1, NA, 0, 6, 49, 68, 107, 52, 66, 83, 85, 79, 107, 109, 73, 54, 71, 57, 11, 72, 38, 28, 16, 17, 20, 0, 14, 37, 35, 46, 24, 13, 13, 44, 23, 2, 0, 5, 58, 31, 86, 76, 74, 76, 48, 91, 63, 75, 83, 81, 55, 39, 14, 24, 22, 24, 69, 77, 67, 53, 58, 69, 53, 70, 67, 104, 80, 82, 61, 96, 73, 75, 51, 16, 36, NA, NA, NA, NA, NA, NA,
+#> NA, NA, NA, NA, 0, 0, 0, 76, 14, 7, 1, 0, 0, 1, 0, NA, NA, NA, NA, 0, NA, NA, NA, 10, 37, 65, 79, 39, 75, 80, 75, 64, 53, 42, 44, 48, 54, 38, 7, 19, 2, 10, 15, 2, 27, 16, 28, 45, 36, 63, 71, 88, 94, 53, 92, 49, 49, 40, 31, 8, 10, 64, 65, 82, 72, 75, 9, 55, 67, 73, 67, 65, 73, 57, 5, 23, 45, 14, 12, 1, 9, 6, 6, 2, 7, 11, 0, 7, 4, 1, 3, 7, 9, 0, 3, 1, 1, 1, 7, 25, 47, 70, 23, 29, 18, 8, 15, 22, 28, 31, 28, 12, 18, 10, 0, 1, 0, NA, NA, NA, NA, NA, 1, 3, 6, 4, 0, NA, 1, 2, 1, 2, 0, 0, 0, 1, 0, 0, 0,
+#> 1, 0, 3, 60, 88, 72, 69, 77, 84, 77, 81, 42, 62, 73, 71, 64, 42, 12, 0, 3, 6, 5, 5, 7, 5, 4, 2, 3, 8, NA, NA, 0, 3, 4, 0, 1, 5, 0, 25, 44, 38, 35, 33, 21, 9, 1, 49, 111, 89, 119, 105, 113, 146, 130, 78, 118, 41, 72, 119, 105, 77, 77, 37, 66, 67, 110, 21, 63, 101, 89, 17, 58, 70, 40, 7, 0, 4, 4, 1, 0, 6, 2, 1, 4, 5, 4, 3, 3, 5, 0, NA, NA, NA, NA, NA, NA, NA, NA, 0, NA, 0, NA, 0, 0, 0, NA, NA, NA, 63, 114, 87, 61, 65, 43, 70, 51, 80, 89, 80, 81, 58, 0, 65, 0, 26, 17, 29, 87, 51, 58, 77, 107, 50, 40,
+#> 8, 42, 22, NA, NA, 1, 0, NA, NA, 3, NA, 0, NA, 0, 0, NA, NA, NA, NA, NA, NA, 3, 7, 27, 46, 87, 87, 85, 99, 7, 89, 24, 16, 60, 42, 41, 10, 18, 18, 41, 34, 42, 53, 19, 33, 20, 5, 13, 31, 16, 4, 10, NA, NA, NA, 4, 7, 4, NA, NA, NA, NA, NA, 3, 5, 66, 53, 98, 43, 113, 131, 94, 118, 89, 115, 77, 60, 38, 22, 66, 5, 1, 1, 90, 121, 103, 116, 98, 97, 87, 80, 78, 99, 73, 87, 71, 71, 94, 79, 65, 51, 43, 43, 15, 88, 94, 70, 62, 91, 84, 70, 88, 70, 85, 74, 20, 2, 5, 3, 50, 24, 89, 84, 79, 70, 57, 3, 26, 2, 0,
+#> 20, 36, 63, 72, 67, 64, 49, 94, 49, 77, 50, 69, 65, 1, 42, 42, 84, 58, 86, 58, 66, 70, 10, 4, 2, 2, 4, 4, 1, 10, 1, 6, 2, 1, 0, 2, 2, 7, 4, 1, NA, 0, 0, 2, 1, 0, 0, NA, NA, NA, NA, NA, NA, NA, NA, NA, 16, 10, 34, 27, 70, 97, 78, 54, 96, 51, 21, 6, 76, 21, 24, 0, 0, 1, 0, NA, NA, NA, 1, 0, 0, NA, NA, NA, NA, NA, 0, 6, 4, 69, 40, 120, 83, 77, 77, 15, 80, 26, 14, 89, 72, 58, 23, 8, 35, 13, 2, 5, 4, 2, 1, 2, 8, 7, 5, 3, 5, 2, 1, NA, NA, NA, 0, 1, 1, NA, 0, NA, NA, NA, NA, NA, NA, NA, 1, 1, 2, 0, 0, 12,
+#> 18, 11, 1, 27, 41, 48, 51, 24, 35, 33, 37, 54, 42, 16, 25, 16, 13, 15, 2, NA, 0, NA, NA, 0, 0, 4, 3, 0, 4, 3, 4, 10, 5, NA, NA, NA, 0, 7, 3, 2, 6, 2, 103, 94, 114, 113, 68, 81, 77, 104, 116, 104, 100, 67, 36, 85, 54, 1, 16, 53, 51, 77, 53, 56, 40, 55, 36, 62, 45, 39, 20, 18, 25, 14, 4, 2, 43, 75, 82, 114, 65, 76, 73, 23, 23, 76, 67, 56, 53, 19, 32, 52, 29, 27, 25, 1, 8, 7, 64, 71, 43, 72, 43, 15, 13, 22, 51, 46, 34, 0, 0, 2, 1, 0, 0, 0, NA, 0, 1, NA, NA, 3, 75, 67, 51, 34, 8, 21, 31, 26, 4, 29, 7,
+#> 63, 75, 78, 76, 108, 101, 69, 92, 86, 20, 12, 13, 15, 35, 1, 44, 10, 51, 100, 109, 107, 107, 108, 128, 113, 89, 93, 62, 83, 61, 76, 80, 55, 51, 40, 44, 36, 51, 104, 97, 92, 89, 106, 77, 72, 64, 37, 10, 79, 68, 75, 67, 67, 16, 48, 75, 52, 47, 0, 11, 28, 32, 75, 47, 54, 54, 46, 51, 20, 19, 25, 12, 2, 46, 33, 51, 24, 44, 49, 87, 79, 73, 79, 53, 62, 85, 96, 69, 48, 47, 9, 6, 32, 13, 73, 81, 3, 26, 24, 6, 36, 45, 54, 44, 30, 23, 15, 34, 55, 39, 75, 65, 53, 51, 42, 69, 35, 12, 1, 4, 3, 0, 0, 1, 5, 1, 2,
+#> 2, 0, 6, NA, 1, NA, 3, 5, 61, 90, 133, 106, 115, 91, 123, 66, 76, 65, 102, 102, 75, 80, 81, 45, 56, 53, 20, 1, 13, 9, 0, 0, 2, 0, 0, 0, 0, 0, NA, NA, NA, 0, 0, 0, NA, 0, NA, NA, NA, 0, 0, 3, 23, 41, 34, 60, 92, 96, 84, 95, 106, 35, 59, 81, 6, 62, 71, 37, 0, 1, 0, 0, 0, 1, 0, 2, 0, 0, 0, 0, NA, NA, 5, 0, 56, 41, 94, 63, 32, 38, 19, 26, 4, 6, 0, 3, 3, 0, 0, 3, 2, 8, 2, NA, NA, 0, 80, 78, 66, 86, 67, 84, 63, 39, 5, 5, 11, 5, 4, 8, 1, 4, 7, 8, 5, 1, NA, 0, 0, 1, 0, 0, 0, 33, 34, 88, 90, 107, 119, 64,
+#> 82, 79, 69, 77, 70, 79, 82, 67, 97, 65, 59, 17, 5, 0, 0, 6, 8, 5, 0, 3, 4, 10, 2, 9, 2, 9, NA, 0, 0, 0, 34, 91, 107, 117, 93, 94, 79, 40, 64, 89, 78, 62, 59, 1, 1, 2, NA, 0, 0, NA, NA, 0, 0, NA, NA, NA, NA, 1, NA, NA, 0, 2, 7, 1, 2, 0, 0, 0, 0, 5, 19, 63, 67, 93, 49, 65, 77, 66, 37, 27, 0, 1, 19, 89, 54, 55, 70, 50, 89, 52, 76, 69, 60, 53, 42, 68, 24, 23, 14, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, NA, 0, NA, 0, 0, NA, 0, NA, 71, 58, 64, 58, 63, 61, 52, 5, 44, 46, 50, 62, 59, 35, 2, 21, 22, 107, 94, 121, 77,
+#> 94, 73, 45, 37, 64, 61, 39, 27, 10, 0, 19, 5, 85, 87, 101, 111, 78, 88, 67, 63, 74, 36, 8, 34, 40, 53, 61, 67, 50, 57, 61, 56, 74, 48, 28, 14, 5, 55, 42, 89, 76, 72, 86, 72, 59, 55, 55, 18, 11, 41, 76, 58, 64, 44, 60, 80, 15, 40, 40, 57, 5, 24, 2, 3, 8, 49, 100, 88, 101, 77, 83, 39, 20, 4, 29, 50, 83, 43, 67, 97, 48, 73, 42, 4, 65, 9, 39, 17, 6, NA, NA, NA, NA, NA, 3, 9, 6, 1, 0, 0, 0, 3, 0, 7, 56, 59, 94, 72, 83, 31, 15, 1, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 0, 1, 0, 0, 0, 0, 1, 0,
+#> 1, 2, 0, 0, 1, 0, 4, 2, 2, 3, 7, 7, 4, 1, 2, 0, 0, 4, 59, 81, 55, 71, 91, 95, 66, 63, 61, 58, 41, 3, 37, 53, 76, 71, 63, 21, 39, 22, 0, 7, 54, 58, 51, 94, 107, 89, 62, 71, 8, 69, 37, 8, 63, 80, 119, 96, 109, 75, 82, 92, 104, 89, 79, 83, 5, 29, 71, 91, 90, 76, 64, 84, 81, 84, 20, 45, 50, 57, 55, 71, 73, 6, 5, 14, 41, 56, 55, 47, 61, 57, 2, 19, 12, 0, NA, NA, 0, 0, NA, NA, NA, NA, NA, NA, NA, NA, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 16, 85, 81, 120, 40, 83, 115, 66, 8, 30, 88, 64, 68, 56, 98, 75, 16, 31,
+#> 46, 6, 51, 91, 70, 78, 87, 44, 29, 46, 8, 11, 26, 53, 90, 30, 35, 44, 73, 88, 39, 34, 0, 2, 22, 30, 21, 54, 66, 49, 11, 33, 24, 3, 4, 7, 5, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 0, 0, 2, 4, 2, NA, NA, NA, 0, NA, 0, 0, 0, 0, 3, 0, 0, 0, 0, 0, 0, NA, 0, 0, 0, NA, NA, NA, NA, NA, 4, NA, NA, NA, 1, NA, NA, NA, NA, NA, 0, 0, 37, 56, 56, 82, 44, 83, 46, 94, 98, 81, 25, 70, 21, 30, 11, 17, 0, 2, 18, 33, 24, 15, 27, 25, 22, 6, 0, 6, 7, 33, 26, 97, 120, 81, 74, 84, 39, 21, 14, 57, 19,
+#> 81, 29, 81, 27, 38, 17, 73, 88, 81, 45, 136, 95, 3, 93, 62, 114, 115, 84, 64, 133, 89, 121, 86, 63, 99, 63, 75, 1, 2, 47, 29, 1, 20, 32, 74, 76, 49, 48, 70, 45, 12, 69, 39, 10, 97, 87, 74, 87, 62, 87, 16, 26, 75, 104, 48, 38, 130, 118, 60, 48, 10, 64, 49, 50, 42, 60, 37, 49, 35, 40, 71, 31, 3, 28, 22, 39, 56, 53, 15, 1, 3, 2, 69, 53, 15, 12, 21, 52, 42, 25, 11, 4, 1, 14, 105, 101, 90, 113, 68, 37, 32, 62, 74, 15, 7, 31, 32, 28, 3, 34, 13, 14, NA, 0, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 0,
+#> NA, 1, 1, 2, 6, 3, 3, 1, 1, 0, 3, 2, 0, 2, NA, 2, NA, NA, 0, NA, NA, NA, NA, NA, NA, NA, 1, 1, 7, 0, NA, 0, 0, 0, NA, 0, 0, 0, 0, 0, NA, 3, 66, 42, 37, 32, 50, 48, 47, 51, 43, 79, 60, 45, 35, 0, 4, 5, 4, 10, 1, 4, 0, 6, 6, 11, 4, NA, NA, 0, 7, 3, 0, 8, 3, 15, 46, 73, 61, 87, 100, 95, 55, 64, 33, 7, 8, 103, 76, 86, 57, 110, 98, 116, 67, 61, 77, 37, 84, 60, 26, 52, 51, 45, 61, 48, 93, 101, 64, 67, 87, 103, 42, 41, 6, 26, 1, 0, 40, 45, 63, 63, 54, 59, 52, 28, 20, 23, 10, 0, 1, 0, 0, 0, 1, 0, 0, 0, 0,
+#> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 3, 44, 30, 50, 15, 36, 50, 58, 65, 89, 52, 64, 38, 29, 74, 40, 95, 91, 42, 86, 41, 10, 0, 15, 3, 68, 82, 97, 80, 86, 88, 80, 96, 108, 19, 85, 72, 72, 46, 22, 0, 13, 51, 28, 37, 30, 14, 1, 7, 7, 4, 71, 86, 87, 71, 76, 16, 77, 60, 67, 35, 9, 39, 72, 99, 76, 65, 34, 38, 71, 77, 89, 119, 120, 103, 67, 17, 33, 30, 36, 1, 27, 28, 58, 87, 96, 112, 102, 62, 81, 60, 47, 49, 107, 77, 11, 28, 12, 23, 17, 0, 0, 2, NA, NA, 1, 4, 1, 1, 0, NA, NA, NA, 0, NA, 27, 64, 91, 47, 85,
+#> 88, 76, 57, 78, 98, 117, 34, 93, 108, 71, 29, 72, 39, 55, 4, 4, 0, 23, 16, 28, 53, 35, 55, 48, 57, 63, 42, 14, 5, 0, 2, 3, 0, NA, NA, 0, NA, NA, 0, NA, 0, NA, 0, NA, NA, NA, NA, NA, 66, 89, 102, 104, 91, 84, 69, 82, 73, 85, 69, 56, 98, 40, 49, 29, NA, NA, NA, NA, NA, 11, 4, 1, 1, 0, 2, 3, 3, 1, 1, 0, 1, 15, 68, 61, 89, 86, 82, 74, 75, 65, 45, 44, 23, 9, 46, 63, 86, 74, 8, 32, 23, 1, 2, 3, 4, 0, 0, 0, 3, 2, 0, NA, NA, 0, NA, 1, 0, 0, NA, 0, 7, 9, 4, 5, 4, 8, 2, 0, 0, NA, 0, 0, 0, 0, 0, 4, 3, 5, 3,
+#> 0, 3, 2, 0, 0, 51, 19, 49, 60, 100, 90, 52, 48, 56, 57, 9, 18, 7, 14, 1, 2, NA, NA, NA, 0, NA, NA, 0, NA, 0, NA, NA, NA, NA, NA, NA, 0, NA, 0, 0, 0, 0, NA, 0, NA, 0, 0, NA, 1, 0, 0, 0, 64, 63, 42, 7, 2, 10, 32, 9, 8, 4, 1, 58, 100, 98, 91, 84, 79, 59, 52, 81, 85, 81, 77, 73, 75, 82, 27, 40, 67, 32, 7, 10, 23, 26, 19, 31, 72, 68, 85, 82, 79, 57, 76, 78, 5, 50, 97, 77, 101, 70, 110, 17, 66, 77, 71, 33, 40, 22, 39, 6, 4, 7, 5, 55, 47, 19, 14, 40, 14, 3, 23, 11, 43, 38, 30, 93, 85, 104, 89, 108, 48,
+#> 32, 30, 26, 14, 64, 53, 79, 96, 98, 88, 123, 113, 146, 123, 123, 67, 118, 96, 102, 100, 94, 79, 68, 0, NA, 0, NA, NA, NA, NA, NA, NA, NA, NA, 1, 0, 0, 0, 0, 0, 2, 40, 66, 40, 69, 52, 73, 59, 8, 3, 38, 58, 27, 57, 14, 26, 10, 12, 23, 28, 26, 7, 1, 24, 55, 96, 79, 49, 10, 68, 45, 37, 10, 71, 24, 15, 2, 3, 1, 1, 3, 5, 2, 0, 4, 2, 5, NA, NA, NA, 0, NA, NA, 0, NA, 2, 4, 1, 8, 6, 5, 2, 4, 4, 5, 1, 0, 1, 0, 20, 50, 75, 83, 92, 58, 42, 10, 0, 1, 60, 10, 22, 24, 44, 32, 53, 63, 45, 19, 44, 17, 21, 8, 22,
+#> 15, 11, 5, 3, 1, 94, 93, 73, 89, 56, 35, 75, 33, 41, 142, 91, 54, 22, 73, 74, 83, 92, 27, 6, 61, 91, 76, 83, 113, 94, 52, 125, 125, 120, 123, 100, 57, 17, 34, 49, 85, 62, 78, 16, 51, 44, 6, 72, 99, 97, 96, 104, 95, 109, 129, 89, 109, 122, 123, 120, 91, 129, 129, 117, 111, 129, 8, 74, 75, 0, 3, 13, 6, 1, 8, 6, 5, 5, 8, 6, 3, 4, 7, 2, 3, 6, 2, 5, 4, 2, 1, 2, 0, 1, 0, 2, 4, 14, 73, 64, 50, 3, 39, 32, 30, 33, 7, 0, 0, 0, 0, 0, 0, NA, NA, 0, 0, 1, 1, 0, 0, 3, 0, 0, 0, 0, 0, 0, 0, 0, NA, 0, NA, NA, NA,
+#> NA, NA, NA, 0, NA, 7, 76, 67, 78, 90, 61, 73, 23, 84, 94, 75, 46, 43, 58, 54, 6, 7, 30, 24, 104, 102, 80, 80, 67, 70, 55, 30, 40, 48, 1, 28, 17, 31, 87, 72, 58, 105, 74, 53, 69, 86, 72, 98, 43, 58, 29, 17, 8, 27, 31, 3, 29, 47, 36, 44, 29, 40, 46, 39, 19, NA, NA, NA, NA, 2, 0, 3, 7, 3, 5, 4, 1, 0, 0, 0, 6, 6, 5, 1, 11, 3, 4, 6, 8, 6, 3, 3, 5, 4, 0, 4, 5, 2, 6, 3, 2, 84, 82, 80, 88, 105, 109, 78, 71, 132, 64, 86, 138, 111, 113, 73, 42, 34, 14, 4, 5, 48, 92, 85, 85, 57, 79, 96, 27, 84, 88, 61, 70,
+#> 68, 11, 31, 19, 8, 17, 3, 20, 38, 33, 31, 21, 17, 48, 4, 7, NA, 1, NA, 0, NA, NA, NA, NA, NA, NA, 0, 5, 82, 75, 80, 78, 85, 85, 75, 59, 61, 72, 52, 60, 34, 1, 4, 8, 4, 4, 4, 5, 1, 2, 1, 1, NA, 0, NA, NA, 0, NA, 0, 0, 0, 78, 104, 82, 85, 107, 140, 117, 117, 120, 75, 66, 41, 79, 87, 76, 104, 88, 111, 109, 124, 143, 152, 126, 94, 109, 104, 11, 39, 104, 108, 106, 106, 102, 110, 110, 109, 74, 115, 8, 77, 87, 53, 19, 77, 63, 20, 7, 6, 32, 64, 108, 83, 85, 84, 79, 89, 97, 92, 70, 70, 84, 76, 36, 15, 9,
+#> 85, 26, 107, 101, 74, 113, 79, 74, 68, 60, 107, 15, 54, 31, 15, 58, 4, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 0, 24, 39, 56, 56, 56, 116, 98, 88, 116, 66, 70, 67, 90, 72, 71, 74, 50, 33, 11, 41, 14, 32, 14, 65, 74, 72, 87, 72, 86, 55, 97, 88, 87, 92, 107, 75, 66, 43, 13, 21, 82, 52, 46, 53, 38, 33, 34, 5, 4, 4, 59, 59, 85, 85, 76, 96, 58, 143, 113, 108, 64, 107, 95, 86, 22, 29, 66, 1, 6, 7, 7, 7, 2, 6, 5, 3, 10, 4, 11, 0, 0, 0, 0, 1, 5, 1, 0, 0, 1, 93, 50, 8, 35, 51, 13, 0, 63, 74, 51, 83, 84, 86,
+#> 59, 74, 84, 42, 52, 37, 8, 6, 0, 20, 71, 98, 100, 20, 47, 121, 121, 104, 86, 86, 100, 80, 42, 72, 45, 6, 11, 78, 77, 105, 57, 57, 89, 87, 110, 114, 69, 97, 38, 49, 17, 0, 32, 65, 87, 98, 66, 79, 90, 90, 74, 45, 93, 34, 42, 12, 34, 67, 25, 87, 33, 34, 61, 46, 118, 86, 21, 52, 103, 105, 98, 82, 126, 117, 104, 22, 107, 52, 44, 1, 14, 18, 10, 13, 29, 62, 36, 80, 90, 43, 44, 3, 22, 46, NA, NA, NA, NA, NA, NA, 7, 4, 55, 48, 82, 76, 72, 35, 7, 48, 49, 8, 0, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA,
+#> NA, NA, NA, 0, NA, NA, NA, 0, 0, 0, NA, 0, NA, 0, NA, 0, 0, 0, 15, 22, 36, 22, 47, 38, 24, 1, 14, 6, 6, 3, 17, 12, 2, 1, 1, 0, 1, 3, 6, 12, 9, 96, 116, 105, 93, 132, 90, 101, 110, 107, 91, 68, 30, 39, 58, 51, 67, 79, 24, 62, 45, 19, 42, 49, 68, 39, 87, 98, 89, 86, 112, 101, 84, 85, 43, 82, 66, 88, 54, 24, 17, 36, 18, 13, 73, 62, 66, 91, 67, 74, 54, 85, 13, 51, 35, 0, 12, 14, 0, 16, 24, 48, 30, 21, 5, 9, 22, 30, 17, 16, 42, 73, 99, 104, 96, 80, 106, 74, 57, 92, 67, 56, 57, 82, 78, 8, 3, 14, 23, 33,
+#> 93, 96, 87, 102, 68, 79, 65, 89, 79, 132, 87, 59, 3, 11, 2, 43, 64, 68, 109, 47, 72, 59, 90, 91, 107, 84, 91, 85, 64, 16, 29, 18, NA, NA, NA, 0, 3, 3, 0, 3, 1, 4, 3, 5, 2, 0, 4, 7, 4, 0, 0, 0, 0, 0, 0, 0, NA, NA, NA, NA, NA, 0, 0, 0, 0, 0, 8, 93, 67, 111, 90, 95, 84, 60, 108, 63, 84, 78, 15, 30, 5, 81, 64, 82, 87, 104, 1, 20, 67, 100, 90, 81, 69, 37, 47, 41, 39, 33, 46, 80, 92, 105, 81, 87, 54, 5, 53, 46, 4, 6, 17, 31, 6, 18, 4, 34, 21, 9, 21, 25, 24, 70, 54, 63, 73, 45, 16, 25, 49, 59, 22, 11, 22,
+#> 1, 60, 81, 93, 90, 121, 124, 90, 113, 108, 71, 40, 77, 86, 57, 27, 39, 106, 48, 53, 143, 68, 37, 21, NA, 0, 2, 9, 7, 3, 5, NA, NA, NA, NA, NA, NA, 0, 1, 1, 0, 0, 0, 4, 41, 38, 84, 70, 19, 47, 55, 15, 7, 95, 63, 44, 18, 7, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 2, 64, 20, 31, 47, 15, 13, 63, 91, 98, 95, 85, 98, 78, 88, 39, 51, 27, 56, 2, 8, 17, 4, 0, 53, 70, 81, 48, 87, 88, 104, 82, 79, 50, 83, 106, 67, 52, 51, 4, NA, NA, NA, NA, 3, 2, 4, 1, 4, 4, 4, 1, 4, 0, 6, 0, 17, 56, 65, 64, 29, 82, 58, 35,
+#> 18, 46, 30, 1, 21, 57, 6, 2, 3, 10, 75, 60, 72, 84, 46, 30, 54, 53, 75, 44, 75, 13, 55, 42, 43, 11, 23, 2, 1, 0, NA, NA, NA, NA, 0, NA, NA, NA, NA, 1, 1, 1, 4, 2, 4, 2, 1, 0, 0, 0, 2, 1, 1, 60, 22, 80, 69, 81, 65, 93, 82, 43, 47, 48, 62, 40, 5, 0, 10, 5, 71, 52, 65, 68, 75, 63, 74, 109, 92, 87, 45, 42, 12, 24, 5, 40, 34, 43, 13, 31, 58, 52, 24, 51, 18, 49, 42, 5, 35, 46, 84, 84, 69, 64, 104, 126, 101, 92, 100, 100, 66, 82, 82, 61, 31, 41, 66, 9, 21, 42, 86, 65, 98, 118, 91, 107, 63, 93, 67, 10, NA,
+#> NA, 0, NA, NA, NA, NA, 0, NA, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, NA, NA, NA, NA, 0, 0, NA, 0, NA, NA, NA, 0, NA, 0, 81, 97, 44, 52, 62, 23, 61, 55, 5, 2, 1, 3, 1, 3, 3, 0, 0, 3, 4, 2, 0, 0, 5, 51, 85, 94, 99, 108, 131, 92, 93, 84, 117, 108, 112, 79, 84, 66, 36, 62, 6, 32, 0, 21, 50, 53, 108, 84, 95, 113, 58, 6, 8, 18, 1, 1, 36, 16, 82, 97, 94, 108, 83, 22, 62, 7, 56, 65, 93, 53, 2, 24, 1, 13, 40, 53, 37, 93, 74, 102, 114, 81, 97, 104, 13, 67, 45, 19, 8, 72, 39, 41, 92, 59, 89, 84, 90, 134, 114,
+#> 106, 146, 122, 99, 69, 39, 53, 7, 8, 28, 58, 92, 122, 104, 89, 101, 106, 101, 101, 111, 97, 26, 108, 79, 93, 55, 0, 48, 11, 21, 8, 9, 5, 35, 120, 73, 82, 115, 34, 129, 95, 96, 89, 102, 88, 52, 39, 47, 6, 6, 38, NA, NA, NA, NA, NA, NA, 0, 0, 1, 0, 0, 2, 0, 0, 0, 0, 0, 0, 0, 0, 2, 1, 7, 1, 1, NA, 2, 1, 0, 0, 6, 62, 90, 66, 91, 49, 52, 83, 92, 43, 84, 75, 74, 64, 49, 45, 12, 43, 39, 67, 80, 93, 108, 107, 101, 116, 108, 102, 102, 77, 105, 53, 65, 17, 35, 84, 108, 106, 92, 91, 109, 100, 108, 112, 86,
+#> 80, 79, 24, 54, 22, 52, NA, NA, NA, NA, NA, NA, 0, 0, 0, 4, 0, 0, 0, 0, 0, 8, 28, 27, 16, 64, 69, 91, 74, 86, 107, 104, 33, 37, 50, 4, 3, 1, 27, 37, 56, 52, 73, 34, 60, 45, 31, 89, 83, 47, 30, 6, 1, 2, 0, 0, 0, 0, NA, 0, 1, 0, 0, 0, 0, 1, 1, 0, 2, 1, 0, 0, 0, 0, 0, 0, 0, 0, 5, 104, 116, 127, 134, 119, 110, 124, 87, 111, 122, 118, 102, 88, 107, 111, 84, 99, 8, 47, 16, 64, 39, 23, 39, 39, 42, 21, 39, 16, 32, 28, 3, 23, 6, 21, 4, 15, 141, 100, 123, 110, 134, 133, 125, 124, 112, 124, 113, 143, 104, 78,
+#> 74, 67, 74, 21, 83, 9, 82, 37, 68, 113, 78, 28, 78, 73, 98, 98, 57, 71, 9, 55, 22, 19, 1, NA, NA, NA, 0, 0, 0, 0, 0, 0, 0, 1, 4, 0, 0, 1, 0, 0, 0, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 3, 2, 1, 1, 1, 2, 3, 2, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 2, 5, 5, 0, 0, 0, 0, 1, 0, 0, 2, 2, 1, 3, 0, 9, 32, 75, 76, 72, 115, 84, 124, 82, 89, 110, 95, 98, 96, 102, 98, 99, 92, 68, 47, 51, 35, 46, 49, 10, 31, 53, 14, 2, 1, 2, 3, 5, 1, 6, 7, 6, 2, 2, 7, 0, 6, 9, 1, 0, 0, 1,
+#> 2, 3, 0, 0, NA, NA, NA, 1, 1, NA, 2, 0, 0, 0, 0, 0, 0, 0, 11, 122, 111, 103, 104, 13, 101, 120, 24, 28, 28, 82, 39, 24, 17, 10, 93, 120, 74, 88, 96, 52, 37, 98, 109, 28, 94, 55, 58, 24, 52, 66, 31, 26, 4, 11, 53, 48, 42, 92, 82, 96, 92, 95, 69, 89, 63, 66, 63, 43, 11, 7, 63, 46, 49, 61, 110, 56, 60, 48, 90, 49, 41, NA, 0, 0, 2, 5, 0, 3, 6, 2, 1, 1, 0, 6, 5, 0, NA, NA, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, NA, NA, NA, NA, NA, NA, NA, NA, 2, NA, NA, NA, 0, 0, 0, 0, 0, 0, 2, 1, 0, 0, 2,
+#> 1, 9, 13, 26, 31, 69, 73, 59, 86, 64, 57, 57, 15, 31, 59, 63, 56, 40, 76, 102, 61, 118, 88, 111, 74, 3, 30, 11, 60, 89, 97, 122, 104, 91, 101, 85, 95, 107, 83, 21, 43, 41, 27, 27, NA, NA, NA, NA, NA, 4, 5, 4, 0, 0, 1, 0, 0, 0, 0, NA, NA, 0, 0, NA, NA, NA, 0, NA, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 12, 94, 80, 92, 72, 62, 28, 2, 28, 1, 3, 6, 3, 5, 4, 2, 0, 0, 0, 0, 0, 0, 0, 0, 0, 14, 33, 41, 35, 4, 10, 97, 84, 83, 76, 77, 29, 8, 26, 37, 24, 24, 33, 0, 38, 74, 88, 50, 30, 98, 23, 47, 84, 92, 73,
+#> 34, 0, 3, 18, 51, 81, 77, 97, 59, 67, 78, 20, 60, 112, 104, 83, 74, 28, 8, NA, NA, NA, 0, NA, NA, 0, NA, NA, 1, 4, 4, 1, 2, 2, 2, 4, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 4, 1, 0, 1, 52, 52, 57, 106, 134, 98, 121, 110, 84, 92, 87, 59, 14, 62, 48, 20, 85, 76, 50, 46, 9, 32, 6, 1, 21, 59, 39, 84, 55, 21, 46, 68, 58, 48, 22, 6, 1, 44, 103, 69, 69, 56, 71, 101, 75, 17, 30, 40, 14, 2, 87, 114, 100, 123, 116, 118, 113, 90, 103, 69, 66, 87, 108, 82, 80, 47, 56, 58, 1, 19, 20, 18, 30, 0, 0, 6, 26, 14, 3, 0, 0, 0,
+#> 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 12, 112, 49, 106, 114, 102, 70, 51, 83, 127, 93, 116, 50, 21, 61, 17, 83, 79, 46, 57, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 7, 68, 79, 94, 113, 115, 102, 103, 117, 74, 81, 89, 71, 96, 15, 26, 36, 84, 94, 123, 109, 64, 78, 56, 66, 36, 1, 4, 2, 44, 108, 102, 101, 107, 106, 71, 124, 95, 92, 89, 85, 59, 83, 60, 0, 0, 7, 9, 6, 3, 10, 7, 20, 9, 6, 7, 4, 3, 6, 0, 3, 3, 4, NA, NA, 0, NA, NA, NA, NA, NA, 0, 0, 0, 0, 0, 0, 1, 0, 0, 1, 0, 4, 4, 2, 1, 1, NA, NA, NA,
+#> 0, 6, 4, 6, 0, 0, 0, 1, 1, 0, 0, 0, 3, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, NA, NA, NA, NA, NA, NA, NA, 0, 8, 6, 3, NA, 0, 6, 0, 32, 26, 24, 96, 107, 50, 41, 74, 28, 87, 74, 103, 68, 96, 78, 34, 99, 84, 84, 121, 89, 99, 35, 79, 86, 8, 33, 49, 13, NA, 0, 0, NA, NA, NA, NA, NA, 0, 1, 2, 0, 0, 0, 0, 1, 1, 0, 0, 0, 0, 3, 13, 31, 29, 24, 16, 43, 40, 31, 43, 28, 42, 10, 4, 46, 80, 108, 92, 65, 18, 65, 27, 12, 28, 59, 27, 4, 5, 13, 78, 114, 138, 132, 107, 135, 115, 92, 94, 86, 39, 79, 48, 59, 31, 41, 27,
+#> 84, 66, 92, 115, 108, 109, 120, 97, 33, 74, 92, 31, 68, 4, 39, 17, 20, 7, 21, 3, 16, 36, 65, 53, 65, 16, 45, 90, 94, 86, 114, 84, 102, 77, 96, 100, 61, 78, 42, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 87, 39, 95, 130, 103, 100, 113, 87, 34, 92, 66, 15, 29, 69, 4, 19, 85, 120, 100, 99, 53, 47, 78, 105, 60, 69, 2, 52, 0, 1, 29, 56, 50, 92, 59, 79, 83, 72, 67, 65, 91, 18, 55, 49, 34, 12, 70, 100, 102, 97, 116, 95, 32, 38, 82, 117, 72, 54,
+#> 56, 33, 68, 90, 79, 92, 94, 54, 77, 96, 84, 100, 100, 87, 69, 50, 26, 34, 1, 34, 0, 77, 60, 67, 13, 34, 36, 37, 26, 37, 0, 6, 47, 89, 91, 87, 94, 87, 92, 74, 43, 10, 0, 10, 16, 36, 28, 6, 4, 1, 63, 53, 93, 96, 99, 84, 74, 76, 47, 88, 88, 69, 78, 24, 9, 18, 0, 0, 52, 44, 82, 89, 83, 79, 63, 86, 94, 85, 74, 76, 80, 81, 90, 71, 67, 127, 111, 111, 101, 111, 110, 111, 103, 88, 74, 80, 28, 49, 57, 42, 45, 5, 20, 46, 94, 37, 101, 17, 81, 95, 75, 35, 21, 18, 45, 44, 30, 16, 45, 62, 62, 75, 45, 57, 43, 38,
+#> 35, 37, 38, 15, 9, 4, 4, 44, 48, 47, 64, 64, 95, 33, 41, 70, 95, 101, 93, 42, 41, 64, 35, 4, 0, 0, 20, 43, 4, 20, 23, 76, 63, 40, 59, 85, 56, 31, 31, 61, 16, 19, NA, NA, NA, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 112, 118, 137, 133, 129, 119, 99, 100, 124, 115, 105, 85, 49, 89, 85, 1, 51, 40, 82, 57, 34, 35, 70, 78, 84, 112, 106, 128, 90, 92, 69, 90, 93, 70, 30, 4, 27, 16, 54, 68, 67, 114, 76, 65, 22, 27, 61, 61, 40, 33, 10, 0, 0, 0, 0, 2, 3, 5, 0, 0, 0, NA, 0, 0, 0, 0, 0, 0, 0, 0, 0, 12, 82,
+#> 48, 65, 71, 70, 49, 50, 27, 42, 65, 43, 36, 22, 3, 32, 42, 12, 39, 5, 1, 3, 8, 5, 17, 9, 0, 0, 0, 0, 0, 0, 0, 2, 1, 2, 1, 0, 3, 3, 0, 0, 8, 59, 31, 34, 37, 36, 45, 44, 38, 46, 52, 17, 10, NA, 0, NA, 0, 0, 1, 1, 1, 2, 0, 0, 0, 0, 10, 53, 93, 105, 107, 108, 98, 107, 89, 99, 72, 92, 83, 40, 31, 28, 15, 0, 0, 0, 0, 0, 0, 0, 99, 74, 66, 79, 8, 35, 25, 59, 13, 18, 38, 24, 9, 2, 2, 6, 3, 3, 0, 3, 1, 0, 0, 2, 5, 77, 128, 114, 77, 102, 119, 97, 76, 64, 67, 50, 68, 47, 37, 22, 0, 50, 79, 76, 62, 88, 92, 83,
+#> 93, 80, 57, 68, 63, 67, 66, 52, 8, 0, 0, 0, 0, 0, 0, 0, 0, 0, 3, 5, 2, 4, 6, 6, 4, 0, 0, 0, 1, 0, 3, 2, 5, 2, 1, 0, 1, 0, 0, 0, 0, 0, 4, NA, 0, 0, 0, 0, 2, 0, 0, 0, 0, 0, 0, 6, 3, 4, 0, 1, 1, 3, 0, 0, 0, 0, 0, 0, 0, 0, 9, 62, 21, 70, 83, 95, 91, 90, 120, 30, 91, 93, 91, 17, 63, 39, 16, 26, 27, 21, 76, 101, 76, 86, 99, 91, 72, 84, 54, 37, 46, 77, 28, 28, 31, 55, 63, 91, 92, 64, 90, 76, 23, 0, 23, 34, 37, 6, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 8, 8, 92, 72, 68, 45, 0, 26, 6, 4, 2, 5, 14, 8, 11, 0,
+#> 0, 1, 0, 2, 31, 51, 93, 61, 97, 38, 51, 0, 85, 75, 69, 12, 8, 0, 14, 87, 118, 82, 78, 91, 85, 63, 84, 79, 60, 36, 45, 19, 24, 67, 101, 82, 103, 77, 51, 38, 52, 78, 28, 1, 32, 73, 65, 88, 76, 87, 56, 79, 79, 58, 54, 23, 36, 27, 101, 61, 104, 87, 52, 2, 5, 2, 6, 9, 6, 2, 2, 1, 1, 5, 5, 11, 2, 0, 3, 0, 0, 10, 47, 1, 59, 46, 52, 79, 94, 119, 115, 116, 74, 77, 86, 84, 65, 84, 59, 73, 0, 0, 0, 0, 0, 1, 0, 2, 5, 1, 2, 0, 19, 43, 47, 90, 48, 4, 10, 15, 16, 50, 34, 42, 4, 9, 4, 6, 1, 70, 66, 42, 40, 66, 35,
+#> 0, 9, 13, 2, 61, 110, 101, 78, 39, 72, 103, 48, 59, 21, 30, 66, 101, 112, 99, 38, 48, 63, 39, 103, 113, 90, 66, 5, 56, 57, 6, 25, 35, 49, 86, 68, 111, 86, 96, 67, 77, 44, 39, 5, 2, 15, 77, 73, 82, 78, 30, 32, 56, 64, 76, 68, 87, 39, 13, 20, 56, 55, 93, 49, 40, 10, 23, 74, 108, 54, 75, 52, 27, 19, 18, 84, 71, 59, 70, 50, 104, 69, 88, 87, 74, 54, 84, 82, 95, 88, 79, 83, 26, 0, 2, 56, 31, 43, 40, 0, 1, 22, 68, 118, 103, 118, 102, 99, 118, 104, 37, 61, 123, 100, 96, 88, 54, 1, 28, 12, 44, 77, 58, 82,
+#> 60, 70, 67, 24, 26, 11, 17, 3, 22, 4, 0, 7, 14, 71, 84, 92, 81, 49, 84, 98, 97, 71, 59, 75, 89, 69, 66, 41, 15, 9, 72, 73, 80, 61, 60, 118, 48, 84, 84, 79, 84, 69, 23, 0, 1, 0, 2, 1, 2, 1, 2, 3, 3, 2, 4, 2, 4, 1, 1, 1, 3, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 3, 2, NA, 0, 0, 0, 0, 1, 1, 7, 2, 0, 0, 3, 2, 2, 0, 20, 54, 73, 62, 87, 69, 54, 74, 80, 54, 10, 11, 0, 31, 70, 55, 19, 58, 63, 67, 70, 46, 57, 37, 41, 18, 32, 3, 5, 4, 1, 1, 3, 2, 3, 4, 1,
+#> 1, 2, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 5, 52, 104, 94, 105, 105, 87, 81, 28, 34, 65, 53, 0, 14, 69, 51, 86, 67, 36, 11, 6, 3, 53, 28, 42, 41, 33, 55, 48, 54, 23, 6, 9, 3, 39, 101, 106, 112, 91, 85, 96, 111, 111, 109, 103, 101, 64, 66, 107, 75, 82, 100, 103, 85, 60, 42, 93, 61, 65, 67, 66, 24, 29, 0, 3, 6, 0, 6, 10, 8, 9, 8, 7, 1, 0, 3, 0, 3, 0, 2, 21, 35, 28, 35, 97, 55, 43, 70, 30, 34, 44, 44, 2, 50, 4, 8, 42, 18, 65, 107, 92, 85, 103, 107, 110, 28, 18, 2, 33, 40, 32,
+#> 61, 70, 104, 101, 136, 108, 118, 103, 123, 117, 115, 93, 95, 107, 81, 79, 25, 0, 57, 77, 106, 114, 114, 93, 80, 102, 76, 99, 88, 79, 3, 49, 2, 11, 6, 71, 74, 64, 27, 41, 45, 80, 46, 3, 13, 10, 24, 50, 87, 28, 47, 87, 74, 58, 26, 58, 105, 90, 82, 76, 46, 28, 33, 82, 107, 59, 92, 90, 68, 58, 5, 27, 64, 49, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 2, 3, 0, 4, 1, 2, 0, 27, 99, 76, 11, 51, 72, 101, 83, 56, 73, 32, 64, 85, 70, 36, 10, 14, 39, 62, 97, 84, 97, 85, 53, 19, 63, 56, 6, 62, 19, NA, NA, 0,
+#> 1, NA, 0, 0, 0, 0, 0, 3, 3, 5, 4, 4, 2, 4, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 119, 125, 125, 101, 92, 55, 30, 49, 62, 64, 59, 78, 62, 93, 70, 103, 103, 104, 105, 81, 77, 82, 2, 1, 28, 68, 67, 54, 76, 13, 41, 42, 18, 61, 86, 62, 98, 94, 88, 38, 81, 62, 60, 69, 13, 36, 93, 131, 104, 113, 112, 75, 54, 48, 73, 74, 14, 23, 20, 61, 51, 68, 63, 63, 51, 44, 43, 57, 68, 65, 68, 119, 120, 107, 52, 42, 95, 83, 95, 103, 83, 24, 0, 0, 9, 8, 8, 9, 9, 9,
+#> 7, 5, 8, 3, 47, 33, 99, 122, 119, 113, 18, 83, 101, 86, 58, 94, 21, 36, 41, 99, 96, 113, 115, 88, 87, 60, 91, 63, 54, 24, 10, 76, 110, 106, 110, 104, 76, 95, 95, 114, 73, 39, 9, 90, 12, 27, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 6, 31, 12, 51, 89, 37, 3, 99, 76, 91, 64, 72, 72, 38, 0, 4, 3, 38, 81, 63, 68, 68, 25, 78, 72, 61, 19, 57, 15, 0, 0, 1, 0, 1, 0, 0, 1, 3, 1, 0, 0, 0, 0, 0, 0, 4, 4, 5, 5, 6, 8, 4, 0, 2, 0, 0, 1, 1, 0, 0, 1, 5, 38, 11, 100, 85, 91, 99, 77, 68, 25, 47, 12, 15, 111, 134, 118, 101,
+#> 73, 15, 34, 14, 21, 4, 20, 65, 87, 87, 63, 45, 57, 50, 51, 45, 76, 41, 83, 84, 70, 32, 40, 43, 9, 77, 58, 19, 1, 2, 34, 21, 41, 22, 94, 77, 59, 105, 57, 61, 42, 34, 5, 97, 82, 85, 119, 115, 127, 139, 76, 100, 48, 87, 102, 65, 78, 71, 2, 82, 109, 86, 103, 94, 95, 83, 82, 19, 78, 1, 23, 30, 32, 101, 105, 97, 81, 62, 56, 63, 23, 26, 13, 25, 10, 11, NA, NA, NA, NA, NA, NA, 0, NA, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 5, 86, 118,
+#> 115, 53, 102, 81, 91, 72, 46, 91, 92, 113, 101, 109, 108, 30, 68, 87, 9, 7, 0, 7, 2, 2, 0, NA, 0, 0, NA, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 2, 0, 1, 0, 2, 0, 4, 7, 3, 6, 4, 2, 5, 4, 1, 2, 0, 0, 0, 0, 0, 0, 0, 0, 0, 2, 0, 0, 6, 3, 5, 2, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 2, 7, 8, 2, 0, 2, 3, 2, 0, 7, 17, 83, 101, 103, 90, 87, 108, 63, 12, 69, 83, 76, 5, 36, 1, 1, 65, 107, 80, 78, 100, 94, 86, 80, 44, 69, 12, 36, 29, 30, 37, 45, 34, 55, 65, 68, 40, 34, 20, 50, 62, 113, 59, 27, 30, 35, 35, 4,
+#> 76, 10, 8, 5, 70, 78, 102, 102, 84, 95, 26, 46, 82, 14, 10, 9, 23, 2, 19, 83, 51, 31, 44, 99, 72, 93, 72, 97, 46, 61, 80, 92, 43, 47, 25, 18, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 6, 67, 100, 96, 78, 39, 91, 83, 74, 0, 1, 12, 66, 27, 47, 46, 26, 19, 20, 3, 5, 20, 12, 42, 67, 91, 92, 70, 31, 26, 68, 96, 51, 8, 100, 45, 7, 52, 98, 43, 95, 80, 103, 73, 43, 22, 23, 29, 96, 47, 73, 53, 44, 42, 9, 10, 14, 3, 3, 8, 42, 104, 63, 19, 44, 14, 42, 53, 7, 28, 23, 80, 104, 101, 89, 93, 69, 96, 110, 65, 23, 62, 56, 19,
+#> 49, 70, 87, 19, 103, 70, 23, 38, 93, 45, 52, 32, 0, 0, 0, 1, 0, 0, 0, 0, 0, 6, 0, 3, 5, 5, 8, 6, 16, 61, 83, 76, 68, 103, 100, 88, 74, 0, 0, 1, 0, 0, 0, 0, 0, 0, 1, 0, 0, 2, 0, 0, 0, 6, 84, 99, 51, 110, 85, 52, 93, 84, 26, 43, 2, 29, 57, 97, 84, 30, 64, 96, 75, 57, 10, 29, 30, 47, 93, 97, 82, 115, 74, 35, 77, 80, 0, 2, 4, 5, 7, 4, 5, 4, 4, 0, 60, 70, 78, 66, 69, 31, 11, 3, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 84, 60, 33, 10, 10, 50, 64, 8, 34, 48, 93, 57, 56, 28, 67, 38, 72, 50, 50,
+#> 90, 92, 71, 67, 79, 54, 29, 54, NA, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 82, 109, 108, 32, 100, 43, 62, 55, 58, 7, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 4, 0, 0, 1, 1, 0, 0, 2, 4, 6, 2, 2, 4, 4, 4, 2, 0, 3, 0, 0, 0, 1, 1, 0, 0, 0, 1, 0, 0, 2, 21, 41, 54, 85, 61, 26, 18, 18, 27, 31, 53, 111, 92, 89, 72, 35, 87, 2, 0, 0, 0, 0, 0, 5, 5, 4, 4, 5, 1, 4, 0, 5, 15, 104, 48, 101, 89, 81, 33, 72, 71, 46, 31, 3, 1, 1, 1, 3, 58, 75, 38, 7, 54, 109, 105, 64, 82, 101, 108, 11, 69, 82, 106, 101, 59, 101, 32, 95, 1, 1,
+#> 0, 30, 4, 35, 59, 73, 60, 11, 54, 70, 33, 15, 3, 0, 3, NA, NA, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 58, 17, 78, 61, 72, 74, 65, 71, 83, 81, 59, 68, 82, 54, 105, 113, 97, 84, 100, 88, 86, 60, 13, 1, 12, 5, 0, 6, 7, 10, 3, 4, 1, 0, 1, 15, 35, 19, 75, 60, 64, 86, 49, 87, 90, 3, 28, 41, 70, 53, 53, 53, 20, 98, 94, 10, 119, 43, 92, 71, 66, 1, 2, 4, 10, 2, 8, 5, 2, 35, 37, 72, 67, 59, 13, 24, 60, 72, 28, 34, 101, 93, 90, 87, 40,
+#> 72, 97, 106, 94, 79, 72, 59, 89, 81, 73, 5, 18, 53, 70, 69, 71, 67, 68, 77, 74, 59, 31, 55, 58, 79, 51, 13, 30, 53, 38, 44, 78, 77, 74, 72, 62, 57, 63, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 3, 0, 0, 0, 0, 0, 0, 9, 28, 63, 42, 39, 44, 21, 2, 18, 90, 122, 112, 91, 76, 136, 102, 31, 73, 98, 30, 48, 81, 39, 87, 70, 66, 54, 20, 66, 17, 52, 84, 73, 105, 107, 94, 77, 85, 0, 1, 0, 5, 1, 0, 0, 16, 65, 80, 50, 77, 28, 26, 54, 22, 8, 27, 20, 1, 75, 66, 42, 66, 50, 102, 84, 39, 81, 70, 24, 79, 61, 55, 59,
+#> 52, 68, 43, 0, 0, 0, 0, 0, 1, 0, 7, 0, 3, 2, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 5, 5, 41, 85, 54, 53, 67, 46, 13, 89, 78, 53, 44, 76, 85, 66, 56, 45, 45, 53, 89, 71, 66, 30, 2, 46, 75, 15, 76, 70, 73, 41, 12, 66, 73, 49, 18, 6, 0, 4, 1, 34, 62, 77, 43, 95, 59, 28, 27, 74, 74, 94, 87, 107, 97, 89, 91, 83, 50, 93, 67, 74, 79, 2, 10, 50, 48, 52, 49, 76, 100, 92, 59, 47, 40, 57, 1, 20, 129, 109, 115, 104, 98, 71, 41, 118, 1, 3, 12, 51, 54, 63, 45, 61, 65, 54,
+#> 66, 57, 43, 38, 68, 48, 19, 6, 38, 2, 3, 62, 75, 54, 70, 54, 69, 85, 42, 14, 34, 0, 0, 63, 47, 80, 84, 89, 89, 71, 72, 0, 1, 4, 2, 3, 1, 9, 59, 65, 72, 77, 73, 69, 0, 0, 0, 0, 0, 0, 0, 0, 1, 4, 0, 0, 0, 0, 0, 4, 66, 65, 86, 54, 98, 24, 88, 38, 102, 20, 38, 48, 57, 52, 28, 82, 103, 75, 103, 49, 58, 97, 14, 79, 51, 38, 37, 72, 80, 95, 19, 42, 17, 76, 44, 60, 0, 1, 5, 50, 37, 40, 5, 1, 2, 51, 48, 7, 16, 9, 75, 103, 65, 100, 0, 44, 126, 99, 101, 42, 18, 64, 70, 46, 60, 1, 12, 14, 49, 55, 102, 87, 30,
+#> 93, 93, 70, 53, 74, 32, 44, 17, 4, 27, 54, 55, 101, 9, 44, 71, 89, 94, 0, 0, 2, 2, 3, 2, 0, 1, 0, 0, 0, 1, 58, 70, 46, 9, 27, 56, 7, 7, 0, 0, 1, 0, 0, 22, 62, 79, 71, 85, 1, 0, 1, 0, 3, 26, 39, 59, 85, 35, 46, 47, 34, 94, 63, 45, 79, 75, 62, 89, 47, 0, 2, 5, 4, 3, 10, 9, 80, 88, 3, 3, 26, 80, 64, 85, 86, 9, 45, 61, 38, 10, 38, 63, 63, 66, 94, 68, 5, 57, 76, 62, 62, 74, 69, 40, 111, 43, 2, 20, 57, 69, 68, 57, 74, 76, 0, 2, 1, 0, 0, 0, 0, 0, 3, 5, 0, 35, 62, 70, 74, 27, 62, 62, 39, 2, 29, 90, 78, 34,
+#> 38, 9, 92, 88, 8, 64, 41, 111, 18, 83, 73, 84, 22, 44, 52, 54, 65, 1, 34, 89, 93, 122, 24, 60, 49, 62, 92, 79, 56, 52, 87, 21, 12, 7, 86, 29, 61, 64, 12, 16, 81, 29, 34, 24, 57, 93, 7, 60, 84) x c(54, 77, 50, 59, 50, 62, 62, 2, 4, 48, 3, 12, 60, 80, 101, 101, 73, 92, 146, 115, 103, 117, 132, 148, 111, 152, 147, 144, 148, 72, 22, 58, 94, 90, 94, 81, 117, 118, 48, 93, 77, 3, 59, 78, 108, 83, 58, 60, 40, 17, 23, 39, 17, 15, 82, 72, 190, 225, 177, 179, 174, 167, 105, 10, 35, 43, 57, 50, 27, 35, 42, 23, 23, 10, 2, 5, 10, 18, 4, 22, 61, 49, 52, 40, 54, 43, 42, 13, 14, 27, 11, 18, 79, 54, 54, 57, 52, 44, 40, 29, 1, 84, 172, 191, 180, 184, 203, 237, 187, 158, 187, 169, 164, 55, 86, 13, 12, 0, 8,
+#> 29, 31, 44, 40, 30, 52, 34, 39, 32, 22, 32, 34, 44, 33, 18, 16, 27, 26, 21, 8, 2, 1, 57, 197, 197, 118, 152, 232, 132, 1, 167, 208, 82, 214, 152, 168, 152, 227, 115, 165, 156, 108, 137, 105, 0, 8, 14, 25, 0, 32, 14, 17, 20, 14, 12, 10, 5, 1, 2, 28, 26, 28, 30, 30, 24, 20, 20, 25, 25, 22, 29, 19, 23, 8, 3, 0, 116, 193, 143, 104, 134, 152, 166, 143, 110, 31, 101, 55, 165, 184, 167, 78, 116, 6, 145, 166, 72, 49, 180, 152, 144, 13, 97, 0, 31, 80, 66, 78, 62, 68, 61, 63, 62, 3, 41, 45, 36, 13, 0, 20,
+#> 65, 90, 64, 21, 85, 65, 83, 59, 82, 43, 26, 55, 19, 0, 0, 39, 101, 170, 185, 184, 143, 171, 166, 188, 184, 185, 170, 217, 189, 193, 183, 183, 92, 18, 0, 189, 208, 191, 165, 89, 144, 9, 9, 14, 25, 27, 18, 30, 34, 33, 5, 1, 4, 0, 1, 12, 22, 10, 13, 21, 13, 15, 8, 4, 17, 3, 0, 23, 28, 30, 38, 25, 11, 29, 13, 9, 10, 12, 1, 1, 0, 1, 36, 113, 212, 188, 216, 194, 248, 226, 167, 127, 208, 201, 225, 161, 191, 143, 197, 211, 189, 211, 157, 79, 175, 114, 2, 21, 35, 173, 160, 170, 130, 178, 141, 136, 149, 159,
+#> 123, 138, 123, 96, 131, 95, 78, 31, 16, 3, 5, 1, 15, 133, 129, 149, 136, 135, 130, 128, 71, 126, 48, 6, 0, 79, 64, 51, 142, 114, 100, 114, 83, 127, 57, 65, 63, 36, 37, 69, 45, 15, 70, 123, 146, 110, 83, 107, 95, 117, 80, 54, 14, 80, 57, 86, 90, 162, 41, 174, 84, 37, 216, 38, 198, 70, 4, 77, 5, 83, 191, 168, 202, 184, 206, 110, 171, 145, 150, 85, 157, 129, 145, 146, 158, 113, 127, 1, 0, 1, 15, 19, 13, 20, 13, 25, 22, 18, 23, 9, 11, 4, 15, 24, 4, 15, 21, 12, 23, 21, 25, 21, 9, 9, 1, 80, 176, 192, 201,
+#> 194, 176, 182, 171, 199, 175, 180, 201, 168, 178, 158, 181, 124, 139, 155, 124, 61, 34, 47, 117, 180, 160, 209, 122, 127, 154, 140, 144, 158, 154, 151, 149, 88, 97, 20, 136, 141, 94, 136, 127, 125, 122, 114, 35, 163, 127, 137, 73, 52, 16, 41, 0, 0, 17, 29, 12, 20, 23, 24, 27, 20, 20, 14, 17, 14, 11, 14, 13, 11, 23, 12, 6, 6, 6, 3, 3, 9, 18, 3, 0, 24, 135, 158, 98, 91, 142, 168, 173, 146, 138, 112, 137, 68, 45, 32, 22, 77, 3, 8, 90, 198, 188, 180, 189, 184, 181, 173, 168, 163, 91, 165, 224, 177, 194,
+#> 182, 194, 147, 129, 76, 10, 0, 1, 23, 35, 83, 85, 67, 70, 62, 45, 19, 17, 4, 2, 0, 23, 81, 86, 52, 48, 16, 0, 3, 26, 168, 183, 167, 222, 189, 193, 176, 211, 184, 150, 146, 214, 183, 161, 218, 167, 167, 164, 171, 51, 18, 35, 25, 31, 29, 17, 26, 16, 21, 11, 18, 24, 8, 9, 24, 15, 4, 4, 13, 13, 24, 30, 38, 35, 30, 34, 32, 33, 40, 24, 17, 30, 22, 18, 32, 42, 20, 16, 39, 35, 45, 35, 32, 34, 32, 27, 33, 28, 25, 7, 4, 24, 1, 0, 9, 18, 23, 36, 15, 6, 14, 0, 125, 49, 37, 71, 150, 20, 145, 130, 130, 118, 150,
+#> 150, 128, 124, 163, 117, 124, 133, 113, 18, 32, 9, 24, 46, 84, 111, 135, 125, 65, 72, 33, 78, 88, 17, 14, 1, 0, 2, 2, 16, 26, 12, 33, 16, 12, 6, 3, 17, 13, 16, 16, 15, 2, 7, 2, 41, 55, 44, 67, 69, 144, 140, 124, 151, 112, 123, 88, 88, 21, 1, 5, 0, 1, 117, 34, 114, 143, 151, 149, 128, 136, 166, 151, 153, 143, 92, 64, 29, 131, 152, 75, 14, 1, 0, 3, 6, 12, 11, 12, 23, 1, 9, 14, 0, 0, 7, 68, 50, 126, 100, 150, 155, 129, 34, 15, 19, 148, 81, 5, 8, 23, 40, 31, 57, 50, 81, 30, 15, 0, 0, 12, 47, 43, 53,
+#> 94, 93, 55, 26, 4, 16, 8, 56, 14, 29, 45, 28, 1, 3, 21, 11, 10, 19, 0, 22, 18, 20, 25, 23, 11, 20, 25, 13, 9, 12, 9, 16, 12, 8, 0, 3, 5, 60, 81, 98, 109, 98, 64, 75, 45, 0, 6, 7, 9, 101, 180, 159, 165, 144, 141, 172, 128, 142, 144, 171, 160, 101, 63, 44, 119, 35, 3, 21, 12, 2, 2, 2, 1, 9, 165, 159, 198, 200, 190, 182, 97, 156, 154, 166, 97, 65, 0, 66, 57, 133, 103, 54, 77, 67, 69, 61, 47, 29, 55, 1, 14, 17, 13, 4, 6, 7, 2, 12, 3, 3, 3, 29, 233, 226, 197, 153, 43, 99, 202, 162, 23, 181, 218, 77, 41,
+#> 86, 95, 86, 66, 108, 105, 80, 81, 43, 33, 21, 10, 27, 2, 61, 104, 130, 133, 118, 109, 67, 59, 28, 17, 24, 19, 13, 32, 22, 33, 30, 1, 12, 27, 29, 15, 24, 15, 19, 7, 6, 23, 25, 2, 0, 146, 176, 172, 178, 156, 164, 151, 122, 122, 148, 168, 158, 205, 146, 114, 59, 116, 172, 164, 163, 184, 135, 140, 189, 15, 118, 121, 67, 110, 134, 1, 9, 83, 132, 167, 90, 97, 154, 84, 172, 139, 97, 17, 10, 0, 8, 3, 17, 21, 23, 15, 1, 6, 9, 15, 13, 6, 10, 19, 14, 12, 3, 3, 11, 22, 150, 186, 176, 181, 143, 151, 172, 115,
+#> 134, 166, 179, 164, 191, 169, 57, 38, 0, 3, 11, 117, 140, 163, 133, 143, 111, 152, 133, 132, 157, 185, 187, 134, 20, 10, 20, 33, 42, 49, 34, 24, 17, 67, 62, 99, 43, 27, 18, 111, 2, 56, 3, 12, 9, 82, 130, 110, 134, 67, 138, 83, 64, 4, 1, 2, 33, 50, 95, 164, 207, 140, 167, 138, 116, 41, 174, 126, 113, 14, 96, 81, 152, 153, 170, 119, 119, 80, 155, 137, 132, 53, 136, 16, 120, 155, 148, 163, 175, 154, 150, 96, 85, 12, 21, 28, 24, 18, 14, 7, 55, 88, 89, 90, 90, 55, 101, 118, 134, 130, 75, 104, 40, 94,
+#> 84, 70, 59, 16, 14, 4, 4, 18, 12, 2, 6, 9, 15, 7, 10, 21, 1, 3, 5, 30, 88, 126, 117, 126, 125, 113, 65, 43, 67, 83, 26, 13, 156, 134, 129, 33, 71, 9, 0, 124, 179, 149, 149, 127, 141, 99, 73, 13, 31, 172, 153, 138, 161, 170, 136, 177, 113, 137, 159, 191, 182, 201, 131, 212, 221, 119, 80, 18, 98, 106, 110, 95, 96, 73, 111, 131, 105, 124, 87, 30, 94, 60, 6, 1, 0, 15, 10, 14, 17, 9, 8, 11, 12, 14, 4, 10, 18, 141, 144, 124, 142, 146, 12, 128, 131, 180, 198, 161, 158, 62, 55, 7, 88, 159, 157, 146, 134,
+#> 104, 10, 12, 82, 78, 71, 75, 85, 106, 82, 67, 96, 79, 74, 45, 55, 30, 2, 0, 1, 15, 173, 170, 169, 174, 180, 135, 162, 181, 181, 180, 168, 86, 102, 12, 33, 1, 0, 48, 131, 149, 36, 80, 66, 9, 15, 11, 0, 7, 14, 12, 6, 5, 13, 112, 0, 131, 170, 149, 182, 158, 139, 164, 118, 113, 135, 157, 15, 8, 10, 2, 4, 75, 141, 105, 74, 28, 21, 28, 66, 99, 109, 103, 107, 78, 32, 50, 143, 101, 116, 132, 91, 132, 51, 193, 209, 135, 89, 153, 141, 91, 127, 99, 1, 67, 130, 150, 129, 131, 126, 5, 37, 15, 35, 19, 133, 113,
+#> 113, 97, 121, 192, 180, 180, 157, 183, 104, 116, 135, 61, 19, 8, 0, 5, 15, 21, 7, 0, 11, 10, 2, 4, 1, 1, 78, 177, 190, 154, 180, 257, 216, 246, 194, 224, 178, 201, 167, 12, 205, 133, 2, 29, 37, 40, 95, 139, 172, 204, 128, 205, 200, 104, 184, 192, 173, 172, 186, 199, 156, 138, 105, 13, 48, 24, 95, 91, 66, 127, 83, 140, 153, 75, 73, 98, 108, 77, 53, 59, 14, 155, 171, 117, 163, 218, 235, 250, 163, 227, 203, 167, 205, 188, 229, 32, 118, 13, 3, 27, 7, 5, 2, 18, 3, 28, 1, 26, 3, 89, 78, 88, 33, 61, 52,
+#> 49, 70, 6, 40, 62, 37, 7, 5, 1, 68, 160, 180, 138, 20, 0, 150, 8, 74, 13, 117, 145, 133, 151, 132, 127, 126, 169, 208, 106, 164, 177, 52, 138, 188, 3, 17, 12, 12, 10, 2, 13, 13, 14, 14, 12, 20, 14, 20, 22, 34, 131, 103, 154, 80, 170, 119, 130, 132, 4, 24, 3, 60, 88, 70, 76, 62, 112, 77, 90, 42, 43, 1, 54, 164, 78, 13, 178, 145, 162, 196, 147, 58, 185, 168, 183, 182, 173, 41, 146, 102, 3, 110, 177, 172, 144, 143, 158, 174, 128, 75, 140, 161, 207, 188, 178, 186, 26, 72, 143, 73, 7, 2, 2, 19, 7, 17,
+#> 21, 23, 29, 25, 31, 29, 28, 36, 17, 7, 0, 4, 49, 69, 68, 91, 89, 68, 87, 115, 157, 108, 122, 82, 73, 26, 44, 7, 72, 156, 163, 143, 169, 137, 133, 156, 143, 137, 131, 167, 137, 183, 166, 156, 117, 0, 10, 7, 2, 6, 4, 14, 14, 14, 16, 23, 17, 22, 10, 161, 116, 96, 161, 201, 89, 70, 100, 158, 150, 139, 151, 126, 132, 124, 123, 119, 133, 32, 3, 16, 18, 17, 34, 27, 22, 30, 37, 24, 18, 18, 42, 26, 3, 15, 14, 11, 3, 1, 0, 1, 0, 9, 50, 0, 91, 127, 119, 141, 141, 103, 138, 144, 166, 132, 150, 142, 124, 35,
+#> 64, 3, 96, 59, 143, 149, 132, 151, 204, 180, 177, 174, 136, 202, 0, 5, 7, 65, 150, 108, 126, 104, 157, 177, 158, 196, 99, 26, 1, 0, 1, 3, 9, 24, 4, 32, 22, 19, 14, 10, 3, 20, 16, 14, 5, 3, 59, 177, 8, 179, 211, 185, 187, 188, 216, 227, 216, 179, 202, 199, 207, 128, 93, 25, 98, 0, 15, 25, 21, 23, 33, 15, 11, 1, 1, 13, 13, 21, 20, 25, 18, 10, 7, 11, 9, 17, 2, 1, 4, 8, 11, 8, 18, 27, 22, 16, 16, 11, 13, 13, 0, 129, 72, 85, 127, 98, 141, 153, 151, 150, 131, 137, 13, 28, 36, 4, 35, 45, 77, 67, 86, 111,
+#> 50, 83, 43, 22, 9, 143, 152, 204, 165, 185, 200, 187, 132, 114, 8, 11, 6, 4, 1, 10, 11, 16, 25, 15, 8, 8, 9, 10, 8, 10, 2, 4, 4, 0, 9, 18, 27, 30, 8, 14, 26, 49, 23, 4, 24, 4, 22, 13, 8, 12, 43, 123, 211, 168, 223, 198, 166, 171, 208, 164, 176, 187, 161, 142, 177, 168, 104, 83, 7, 6, 12, 0, 2, 31, 157, 181, 194, 172, 185, 181, 151, 60, 119, 169, 55, 54, 49, 41, 112, 79, 132, 154, 204, 215, 149, 74, 30, 15, 4, 5, 12, 16, 13, 8, 26, 18, 25, 12, 13, 11, 1, 0, 3, 1, 11, 13, 26, 80, 105, 158, 136, 98,
+#> 72, 182, 184, 118, 125, 104, 86, 38, 4, 2, 11, 14, 7, 14, 16, 27, 2, 25, 39, 31, 31, 42, 26, 13, 7, 2, 3, 1, 11, 18, 17, 24, 15, 15, 6, 8, 12, 8, 10, 14, 6, 9, 9, 1, 9, 15, 18, 7, 25, 13, 21, 17, 18, 22, 19, 20, 18, 15, 11, 6, 9, 9, 12, 5, 0, 24, 20, 34, 26, 32, 15, 36, 2, 23, 21, 5, 118, 143, 143, 106, 144, 171, 174, 190, 173, 174, 41, 167, 115, 77, 4, 3, 41, 77, 128, 155, 135, 135, 95, 43, 43, 35, 5, 16, 6, 12, 0, 41, 127, 156, 79, 172, 168, 237, 162, 211, 197, 225, 184, 201, 183, 156, 153, 8,
+#> 13, 11, 23, 29, 52, 33, 29, 30, 21, 28, 37, 36, 22, 10, 0, 0, 8, 3, 8, 0, 2, 17, 23, 25, 21, 16, 25, 28, 13, 5, 7, 14, 11, 2, 1, 23, 182, 167, 195, 188, 204, 187, 180, 190, 182, 102, 146, 137, 143, 2, 31, 14, 121, 154, 173, 194, 156, 159, 145, 169, 161, 138, 124, 176, 175, 95, 79, 0, 33, 1, 0, 3, 32, 27, 67, 65, 127, 144, 44, 4, 88, 144, 47, 26, 11, 76, 75, 39, 16, 39, 15, 30, 0, 0, 0, 9, 4, 17, 30, 18, 21, 13, 26, 27, 18, 8, 15, 18, 4, 1, 5, 2, 1, 0, 5, 20, 21, 13, 13, 3, 2, 7, 0, 2, 0, 0, 20, 7,
+#> 16, 14, 10, 15, 17, 10, 12, 9, 5, 5, 1, 2, 1, 17, 74, 112, 131, 150, 164, 187, 174, 127, 167, 118, 132, 161, 166, 171, 144, 21, 75, 32, 24, 5, 0, 14, 119, 120, 114, 131, 96, 53, 57, 19, 36, 92, 6, 84, 6, 118, 166, 183, 222, 213, 165, 166, 151, 133, 106, 110, 13, 1, 25, 0, 31, 24, 19, 29, 10, 13, 17, 7, 2, 1, 12, 1, 5, 1, 4, 13, 20, 18, 9, 16, 16, 20, 18, 15, 15, 9, 11, 10, 8, 5, 3, 0, 90, 180, 117, 126, 149, 145, 162, 146, 172, 50, 30, 140, 154, 107, 11, 5, 161, 208, 160, 189, 182, 196, 192, 192,
+#> 182, 183, 169, 190, 137, 57, 2, 14, 62, 106, 115, 78, 132, 117, 6, 172, 107, 110, 135, 131, 142, 130, 126, 82, 85, 17, 45, 12, 93, 113, 150, 132, 138, 154, 65, 138, 155, 131, 131, 70, 84, 92, 36, 48, 9, 0, 2, 2, 56, 70, 99, 92, 142, 142, 122, 110, 132, 90, 46, 50, 25, 6, 32, 12, 12, 139, 101, 146, 137, 170, 174, 160, 152, 138, 140, 131, 34, 30, 183, 253, 199, 159, 163, 212, 211, 200, 216, 200, 192, 140, 186, 117, 142, 93, 3, 25, 3, 27, 3, 13, 116, 180, 199, 201, 201, 194, 173, 159, 129, 51, 194,
+#> 171, 163, 187, 172, 180, 43, 9, 1, 17, 18, 22, 28, 23, 20, 38, 5, 19, 26, 20, 18, 11, 12, 14, 18, 18, 20, 16, 0, 0, 0, 10, 165, 220, 197, 88, 142, 183, 228, 202, 130, 83, 189, 42, 56, 185, 110, 69, 177, 189, 141, 160, 126, 5, 171, 76, 122, 49, 3, 49, 194, 167, 227, 180, 174, 187, 176, 148, 133, 92, 137, 158, 103, 162, 26, 9, 77, 77, 65, 55, 7, 16, 41, 103, 101, 51, 21, 13, 50, 0, 8, 16, 24, 14, 32, 33, 16, 7, 20, 1, 9, 0, 0, 0, 139, 99, 137, 92, 178, 139, 15, 14, 88, 171, 181, 143, 164, 216, 175,
+#> 52, 2, 0, 13, 159, 134, 142, 141, 146, 170, 140, 89, 15, 121, 150, 126, 104, 6, 103, 122, 84, 188, 177, 241, 204, 65, 129, 189, 214, 221, 194, 131, 91, 155, 12, 4, 0, 9, 98, 139, 159, 125, 181, 197, 2, 136, 8, 8, 8, 10, 15, 22, 22, 23, 18, 9, 6, 7, 11, 13, 8, 9, 8, 5, 13, 14, 21, 14, 14, 11, 16, 17, 2, 0, 2, 113, 43, 170, 175, 163, 198, 208, 103, 143, 96, 45, 2, 6, 1, 7, 23, 10, 15, 0, 21, 17, 23, 11, 6, 5, 9, 5, 0, 7, 17, 9, 9, 7, 3, 1, 11, 6, 129, 179, 218, 210, 166, 220, 211, 208, 198, 210, 176,
+#> 205, 200, 170, 4, 162, 176, 134, 193, 173, 129, 153, 154, 117, 130, 154, 109, 32, 11, 13, 0, 5, 5, 22, 20, 16, 10, 24, 16, 22, 28, 17, 9, 1, 4, 13, 0, 3, 5, 10, 14, 6, 4, 1, 0, 16, 14, 21, 25, 7, 21, 1, 10, 10, 7, 0, 0, 8, 1, 0, 1, 13, 27, 13, 15, 21, 20, 13, 8, 7, 14, 5, 12, 8, 10, 4, 5, 1, 19, 17, 12, 20, 14, 13, 13, 23, 16, 11, 16, 6, 5, 2, 3, 9, 5, 4, 180, 237, 223, 200, 217, 180, 215, 191, 217, 176, 218, 219, 175, 151, 69, 6, 82, 86, 70, 39, 1, 0, 1, 39, 156, 65, 189, 185, 226, 254, 213, 225,
+#> 153, 213, 203, 71, 66, 78, 110, 85, 122, 21, 106, 128, 115, 105, 68, 94, 81, 81, 64, 24, 0, 1, 9, 223, 221, 234, 94, 214, 188, 138, 173, 166, 133, 177, 194, 108, 43, 21, 42, 1, 75, 4, 5, 5, 9, 6, 3, 15, 18, 4, 13, 19, 27, 19, 4, 7, 17, 3, 1, 14, 16, 6, 6, 5, 3, 14, 12, 4, 8, 16, 9, 11, 3, 11, 11, 9, 2, 4, 23, 108, 61, 114, 175, 175, 150, 157, 87, 172, 157, 20, 67, 15, 13, 14, 5, 17, 28, 15, 15, 22, 14, 19, 16, 4, 2, 14, 0, 1, 20, 102, 164, 172, 231, 175, 231, 91, 161, 167, 111, 94, 28, 82, 105, 66,
+#> 13, 149, 133, 86, 209, 36, 139, 40, 5, 12, 6, 3, 127, 161, 193, 215, 201, 119, 184, 204, 214, 201, 227, 209, 174, 132, 161, 96, 12, 35, 9, 140, 168, 138, 105, 128, 150, 123, 135, 67, 131, 131, 97, 148, 144, 122, 116, 116, 26, 27, 0, 14, 203, 181, 231, 194, 202, 183, 179, 190, 125, 80, 84, 14, 15, 26, 30, 26, 8, 16, 13, 2, 8, 4, 10, 12, 11, 8, 19, 19, 11, 14, 13, 7, 0, 1, 22, 35, 37, 31, 38, 22, 52, 36, 12, 27, 2, 11, 1, 0, 2, 7, 153, 170, 192, 188, 147, 9, 116, 4, 39, 75, 111, 171, 38, 12, 22, 0,
+#> 18, 22, 26, 17, 14, 10, 11, 0, 10, 1, 0, 11, 3, 23, 47, 23, 41, 38, 43, 43, 35, 23, 21, 26, 22, 5, 5, 12, 13, 20, 26, 20, 23, 26, 25, 21, 9, 8, 15, 8, 11, 4, 4, 2, 3, 5, 113, 254, 202, 172, 219, 40, 70, 56, 6, 10, 42, 131, 183, 188, 150, 213, 204, 180, 185, 198, 162, 197, 168, 153, 146, 27, 42, 1, 60, 198, 181, 209, 198, 180, 187, 162, 232, 182, 159, 15, 81, 33, 2, 22, 5, 55, 139, 203, 187, 177, 186, 143, 164, 83, 175, 172, 160, 156, 161, 24, 24, 46, 3, 1, 4, 4, 10, 8, 12, 12, 10, 8, 9, 5, 2, 5,
+#> 98, 80, 25, 146, 147, 189, 148, 145, 133, 104, 13, 74, 14, 0, 13, 1, 10, 7, 18, 18, 23, 12, 13, 16, 9, 6, 6, 5, 5, 17, 15, 12, 21, 19, 30, 23, 13, 16, 10, 11, 7, 13, 14, 0, 18, 13, 18, 16, 21, 23, 18, 13, 9, 13, 9, 15, 9, 11, 18, 18, 15, 22, 21, 19, 19, 22, 8, 7, 5, 3, 12, 11, 5, 4, 1, 1, 91, 219, 250, 200, 226, 223, 131, 127, 32, 152, 132, 113, 9, 81, 77, 9, 1, 2, 1, 3, 11, 18, 9, 13, 10, 10, 21, 13, 11, 0, 9, 5, 0, 0, 5, 19, 30, 22, 20, 17, 21, 23, 10, 18, 9, 6, 10, 5, 0, 32, 206, 173, 138, 227,
+#> 211, 189, 173, 191, 163, 156, 7, 146, 193, 53, 77, 10, 2, 3, 10, 16, 14, 21, 21, 2, 3, 1, 1, 14, 9, 0, 1, 25, 19, 29, 30, 27, 15, 5, 5, 4, 0, 1, 0, 71, 184, 152, 160, 189, 159, 187, 141, 152, 158, 126, 80, 123, 2, 113, 77, 91, 0, 3, 145, 124, 156, 131, 152, 127, 125, 153, 176, 142, 145, 92, 99, 79, 85, 35, 6, 178, 179, 155, 159, 172, 159, 135, 130, 161, 133, 145, 161, 55, 13, 16, 114, 136, 135, 175, 159, 155, 157, 158, 148, 150, 51, 104, 110, 25, 10, 35, 4, 19, 19, 23, 16, 13, 23, 16, 15, 22, 24,
+#> 17, 19, 13, 11, 7, 3, 3, 8, 11, 16, 12, 26, 25, 23, 7, 14, 12, 4, 6, 14, 0, 0, 172, 199, 185, 165, 183, 174, 154, 31, 58, 125, 6, 85, 0, 13, 0, 130, 97, 111, 112, 120, 95, 103, 68, 63, 104, 35, 45, 84, 74, 98, 76, 53, 46, 33, 37, 182, 198, 224, 223, 237, 190, 201, 127, 48, 171, 166, 47, 91, 165, 62, 28, 24, 46, 4, 2, 5, 2, 9, 19, 13, 14, 12, 12, 19, 8, 1, 0, 158, 180, 186, 192, 190, 151, 174, 182, 178, 118, 137, 186, 41, 30, 4, 110, 0, 200, 118, 147, 144, 129, 173, 162, 100, 76, 11, 33, 34, 23, 2,
+#> 1, 15, 18, 15, 4, 0, 36, 11, 22, 10, 4, 0, 0, 9, 19, 17, 16, 14, 21, 11, 15, 10, 10, 11, 2, 8, 10, 16, 2, 3, 5, 63, 188, 161, 182, 128, 32, 2, 30, 84, 73, 23, 46, 140, 179, 182, 145, 180, 164, 190, 191, 175, 160, 164, 122, 155, 150, 162, 89, 115, 139, 5, 0, 1, 2, 110, 153, 192, 201, 205, 180, 153, 151, 150, 117, 1, 7, 21, 28, 21, 16, 18, 16, 14, 15, 10, 13, 1, 0, 135, 201, 203, 16, 200, 175, 156, 195, 18, 84, 145, 100, 0, 19, 58, 129, 195, 202, 214, 188, 171, 198, 183, 200, 180, 166, 182, 169, 149,
+#> 60, 42, 0, 6, 189, 194, 115, 138, 216, 145, 193, 201, 153, 114, 11, 7, 154, 147, 166, 67, 208, 186, 153, 101, 81, 67, 141, 156, 51, 4, 0, 124, 77, 189, 131, 161, 177, 103, 79, 86, 72, 24, 84, 144, 179, 127, 172, 114, 162, 46, 12, 206, 215, 194, 176, 179, 193, 186, 146, 168, 190, 94, 158, 109, 2, 18, 32, 20, 23, 2, 10, 25, 6, 3, 6, 12, 2, 6, 12, 2, 9, 13, 5, 15, 14, 6, 20, 16, 10, 1, 3, 7, 3, 0, 2, 112, 202, 208, 181, 134, 166, 132, 156, 147, 150, 168, 36, 46, 70, 49, 85, 70, 26, 8, 69, 134, 197,
+#> 137, 161, 204, 182, 89, 162, 197, 186, 142, 192, 21, 180, 154, 156, 148, 30, 42, 21, 116, 133, 167, 173, 195, 191, 191, 186, 166, 154, 108, 193, 92, 65, 155, 57, 153, 151, 162, 144, 182, 160, 156, 63, 59, 4, 8, 22, 17, 19, 15, 16, 12, 18, 9, 13, 14, 14, 1, 9, 12, 1, 13, 9, 13, 13, 10, 3, 5, 1, 4, 8, 1, 8, 13, 9, 12, 5, 0, 1, 1, 2, 0, 4, 10, 21, 2, 0, 8, 1, 176, 200, 207, 144, 186, 94, 32, 146, 125, 7, 121, 166, 83, 14, 22, 16, 3, 0, 3, 0, 136, 204, 179, 197, 182, 150, 165, 127, 177, 162, 102, 6,
+#> 76, 86, 36, 26, 14, 140, 125, 212, 199, 130, 170, 139, 26, 6, 42, 25, 13, 24, 22, 13, 18, 6, 0, 0, 1, 2, 1, 0, 80, 192, 181, 179, 196, 213, 147, 148, 58, 1, 17, 10, 14, 38, 35, 3, 37, 36, 38, 29, 28, 37, 37, 26, 24, 35, 11, 27, 20, 10, 3, 5, 36, 68, 82, 63, 6, 36, 22, 23, 133, 146, 99, 74, 60, 104, 111, 69, 13, 25, 43, 76, 31, 1, 14, 14, 172, 126, 78, 199, 158, 116, 50, 113, 87, 47, 123, 116, 34, 0, 0, 0, 17, 1, 22, 23, 19, 3, 31, 18, 4, 23, 9, 0, 12, 11, 5, 2, 10, 14, 2, 10, 4, 7, 3, 2, 0, 1, 5,
+#> 15, 4, 6, 10, 11, 13, 18, 5, 11, 4, 2, 0, 5, 27, 209, 209, 191, 162, 156, 143, 177, 160, 143, 75, 9, 45, 54, 125, 99, 127, 114, 129, 123, 167, 129, 120, 105, 102, 90, 95, 113, 69, 31, 0, 32, 37, 11, 84, 137, 163, 157, 112, 114, 10, 24, 12, 15, 20, 13, 10, 11, 11, 7, 1, 14, 4, 4, 8, 1, 159, 139, 150, 166, 152, 134, 40, 55, 72, 37, 117, 161, 173, 162, 173, 135, 79, 153, 154, 136, 87, 155, 168, 174, 165, 146, 176, 184, 137, 152, 160, 116, 170, 148, 3, 9, 17, 21, 18, 18, 4, 16, 18, 9, 17, 10, 10, 7,
+#> 6, 9, 1, 0, 0, 12, 1, 2, 19, 21, 16, 9, 1, 7, 18, 18, 9, 14, 12, 12, 1, 0, 2, 3, 185, 193, 185, 186, 176, 181, 188, 194, 106, 169, 4, 37, 133, 114, 138, 163, 135, 69, 98, 8, 14, 50, 19, 78, 24, 29, 38, 9, 10, 39, 24, 20, 24, 24, 30, 14, 7, 12, 4, 0, 20, 13, 8, 4, 12, 13, 40, 6, 0, 11, 12, 9, 10, 7, 0, 43, 139, 135, 146, 55, 133, 141, 150, 138, 139, 154, 82, 9, 5, 13, 0, 67, 67, 48, 142, 133, 176, 115, 122, 57, 18, 2, 45, 203, 94, 54, 97, 113, 133, 35, 32, 149, 140, 174, 175, 155, 142, 143, 149, 148,
+#> 88, 9, 7, 79, 0, 56, 137, 49, 92, 122, 143, 123, 15, 40, 47, 144, 91, 25, 38, 40, 2, 133, 143, 151, 159, 139, 49, 148, 36, 66, 29, 16, 16, 0, 0, 65, 146, 135, 173, 188, 167, 136, 65, 119, 129, 70, 13, 41, 24, 13, 1, 9, 79, 157, 140, 130, 129, 112, 100, 58, 146, 115, 55, 39, 18, 167, 131, 139, 128, 130, 125, 124, 59, 3, 2, 12, 5, 15, 25, 15, 23, 29, 6, 3, 4, 14, 4, 6, 1, 19, 13, 7, 13, 125, 170, 164, 181, 190, 139, 170, 218, 13, 117, 44, 13, 33, 100, 157, 167, 161, 128, 164, 147, 151, 132, 87, 42,
+#> 145, 115, 192, 127, 168, 155, 20, 58, 1, 12, 2, 15, 6, 0, 6, 3, 0, 7, 6, 14, 26, 14, 17, 2, 2, 3, 15, 8, 6, 1, 1, 0, 0, 1, 16, 15, 18, 1, 3, 0, 12, 3, 5, 5, 3, 156, 71, 66, 184, 149, 117, 120, 30, 60, 16, 38, 6, 0, 0, 2, 11, 17, 21, 8, 9, 10, 1, 10, 10, 1, 0, 1, 109, 193, 158, 132, 188, 183, 162, 176, 191, 161, 115, 153, 143, 31, 86, 1, 62, 24, 53, 42, 3, 17, 59, 100, 131, 88, 125, 120, 134, 114, 155, 54, 138, 119, 110, 52, 57, 49, 8, 197, 169, 98, 182, 107, 120, 153, 0, 159, 191, 138, 156, 179,
+#> 111, 169, 96, 139, 166, 57, 9, 1, 18, 9, 10, 12, 2, 0, 1, 7, 8, 9, 15, 10, 15, 4, 7, 8, 1, 13, 10, 15, 18, 18, 30, 7, 17, 5, 7, 0, 11, 20, 1, 5, 15, 5, 1, 0, 4, 14, 2, 9, 11, 15, 25, 0, 4, 14, 12, 19, 47, 203, 152, 187, 169, 141, 92, 3, 77, 1, 169, 148, 164, 165, 138, 157, 171, 177, 185, 113, 75, 24, 53, 104, 1, 14, 2, 16, 13, 13, 19, 17, 19, 6, 2, 14, 0, 6, 0, 11, 8, 3, 2, 1, 0, 10, 8, 0, 0, 0, 121, 138, 134, 117, 135, 119, 116, 147, 143, 140, 92, 46, 0, 54, 106, 89, 81, 89, 109, 95, 126, 24, 54,
+#> 63, 23, 16, 205, 208, 207, 159, 185, 153, 150, 10, 45, 90, 3, 40, 1, 115, 138, 101, 186, 153, 150, 155, 161, 157, 160, 39, 97, 8, 166, 77, 141, 131, 82, 85, 12, 116, 71, 1, 12, 4, 9, 16, 20, 36, 25, 20, 11, 15, 2, 12, 14, 6, 3, 0, 4, 4, 10, 3, 0, 0, 19, 11, 15, 14, 10, 12, 1, 200, 98, 106, 104, 89, 26, 1, 0, 20, 147, 220, 197, 228, 183, 230, 207, 192, 205, 194, 200, 195, 179, 184, 176, 159, 87, 91, 107, 143, 86, 1, 1, 11, 14, 16, 13, 30, 25, 20, 9, 5, 6, 1, 6, 49, 123, 143, 126, 7, 75, 157, 77, 86,
+#> 31, 111, 9, 107, 82, 30, 49, 3, 31, 18, 21, 126, 123, 1, 1, 103, 141, 118, 144, 82, 116, 0, 4, 60, 205, 195, 122, 146, 130, 41, 0, 71, 19, 0, 0, 8, 9, 8, 12, 29, 28, 13, 19, 19, 18, 13, 9, 10, 4, 2, 0, 43, 161, 144, 166, 183, 160, 157, 128, 176, 153, 135, 162, 137, 62, 54, 40, 71, 134, 177, 148, 63, 1, 3, 128, 166, 130, 0, 154, 73, 39, 99, 0, 4, 0, 1, 22, 10, 9, 9, 2, 7, 7, 1, 33, 147, 167, 173, 141, 158, 163, 152, 158, 145, 150, 167, 172, 116, 3, 90, 2, 2, 19, 7, 179, 140, 63, 47, 171, 165, 114,
+#> 163, 191, 182, 184, 162, 129, 51, 21, 39, 168, 121, 158, 168, 161, 75, 10, 138, 181, 168, 122, 138, 105, 174, 156, 147, 95, 34, 64, 21, 0, 28, 34, 124, 0, 17, 12, 1, 63, 69, 71, 60, 28, 32, 24, 27, 9, 1, 0, 1, 5, 2, 19, 21, 11, 7, 6, 4, 6, 8, 3, 0, 3, 15, 9, 4, 0, 1, 6, 9, 12, 9, 4, 0, 0, 19, 43, 11, 59, 159, 28, 21, 69, 141, 162, 1, 145, 110, 104, 8, 162, 125, 94, 64, 15, 54, 99, 130, 154, 197, 177, 150, 144, 93, 106, 70, 64, 15, 6, 50, 0, 3, 93, 150, 150, 165, 156, 159, 47, 2, 22, 126, 159, 66,
+#> 155, 171, 146, 156, 69, 47, 158, 153, 146, 67, 24, 61, 39, 31, 0, 8, 11, 7, 11, 20, 12, 21, 14, 12, 6, 7, 11, 15, 12, 7, 11, 13, 7, 8, 13, 1, 0, 1, 0, 155, 170, 195, 224, 176, 191, 190, 101, 96, 5, 4, 0, 1, 0, 0, 11, 13, 2, 10, 1, 8, 7, 1, 1, 4, 16, 17, 18, 5, 9, 1, 0, 24, 133, 46, 69, 197, 1, 87, 28, 39, 3, 103, 151, 143, 51, 149, 92, 71, 3, 159, 168, 148, 207, 159, 135, 170, 17, 100, 160, 143, 205, 173, 162, 125, 65, 104, 20, 1, 1, 138, 154, 142, 26, 188, 112, 179, 218, 191, 88, 45, 141, 24, 66,
+#> 134, 90, 25, 92, 0, 45, 98, 68, 82, 89, 64, 15, 17, 0, 58, 185, 149, 143, 154, 191, 106, 151, 165, 199, 135, 70, 73, 0, 5, 7, 7, 14, 15, 8, 16, 12, 5, 0, 13, 4, 1, 13, 6, 3, 0, 125, 72, 6, 143, 132, 141, 79, 144, 158, 127, 19, 8, 4, 95, 95, 63, 88, 59, 36, 57, 71, 77, 40, 59, 21, 16, 4, 169, 149, 171, 184, 185, 142, 171, 165, 145, 167, 164, 140, 86, 21, 4, 2, 28, 37, 25, 20, 21, 11, 4, 19, 17, 6, 0, 0, 85, 136, 144, 154, 135, 155, 172, 138, 176, 152, 142, 171, 156, 147, 74, 33, 126, 165, 178, 169,
+#> 145, 185, 186, 193, 189, 143, 1, 27, 195, 195, 166, 147, 145, 109, 129, 134, 109, 157, 75, 8, 82, 143, 115, 192, 161, 146, 149, 179, 147, 155, 121, 115, 134, 99, 107, 52, 43, 2, 0, 10, 7, 8, 14, 13, 16, 17, 15, 14, 13, 5, 8, 66, 127, 96, 90, 149, 129, 142, 158, 181, 118, 41, 78, 139, 79, 31, 26, 9, 33, 23, 0, 10, 1, 0, 6, 13, 11, 4, 13, 24, 5, 1, 0, 0, 124, 177, 147, 170, 149, 164, 126, 117, 40, 159, 78, 0, 4, 2, 12, 15, 5, 4, 11, 3, 0, 4, 4, 2, 0, 1, 7, 16, 15, 18, 23, 22, 18, 23, 21, 17, 22, 13,
+#> 36, 24, 14, 21, 18, 16, 11, 4, 3, 103, 144, 171, 146, 153, 70, 132, 15, 106, 95, 18, 7, 175, 170, 203, 170, 185, 157, 159, 120, 81, 98, 134, 146, 138, 147, 146, 176, 114, 71, 30, 37, 10, 31, 42, 89, 112, 102, 76, 68, 87, 5, 125, 109, 83, 36, 25, 1, 0, 16, 18, 34, 29, 37, 21, 28, 26, 21, 19, 18, 3, 3, 1, 10, 19, 13, 17, 15, 13, 9, 9, 6, 0, 29, 27, 40, 19, 65, 69, 101, 106, 125, 95, 22, 37, 105, 61, 16, 4, 4, 9, 9, 11, 10, 8, 4, 1, 1, 0, 3, 0, 2, 7, 10, 0, 0, 3, 175, 146, 164, 196, 177, 194, 189, 134,
+#> 52, 118, 169, 137, 19, 126, 42, 48, 5, 9, 7, 10, 7, 7, 2, 0, 0, 12, 109, 75, 97, 120, 173, 43, 97, 125, 50, 44, 20, 103, 74, 1, 13, 29, 19, 25, 8, 21, 3, 6, 7, 96, 97, 185, 172, 143, 70, 45, 118, 19, 81, 65, 127, 145, 12, 68, 125, 83, 1, 34, 0, 6, 0, 12, 120, 170, 159, 156, 129, 157, 176, 158, 146, 173, 123, 114, 39, 52, 32, 5, 8, 6, 119, 132, 119, 156, 139, 146, 158, 151, 127, 111, 35, 8, 72, 125, 123, 164, 126, 162, 82, 142, 85, 80, 22, 24, 23, 15, 42, 26, 17, 21, 5, 32, 5, 6, 144, 88, 20, 6, 77,
+#> 119, 138, 139, 172, 162, 93, 131, 145, 125, 108, 22, 10, 4, 1, 8, 6, 12, 13, 4, 0, 11, 5, 3, 0, 0, 0, 158, 157, 121, 150, 117, 169, 200, 148, 147, 112, 60, 37, 12, 123, 150, 90, 17, 2, 65, 22, 47, 42, 6, 180, 86, 35, 128, 150, 90, 127, 96, 57, 10, 47, 42, 4, 48, 7, 0, 1, 12, 11, 19, 14, 7, 5, 3, 18, 6, 2, 1, 0, 10, 0, 0, 3, 4, 3, 1, 11, 0, 0, 1, 0, 0, 95, 129, 108, 177, 189, 197, 105, 165, 161, 164, 151, 121, 119, 27, 2, 20, 39, 161, 199, 168, 162, 198, 199, 166, 158, 139, 102, 114, 57, 69, 44, 86,
+#> 35, 16, 13, 16, 16, 9, 8, 8, 4, 0, 19, 7, 1, 2, 116, 174, 172, 150, 164, 168, 178, 104, 90, 114, 40, 11, 19, 0, 159, 160, 141, 0, 5, 132, 153, 164, 132, 143, 135, 157, 143, 135, 120, 70, 14, 12, 123, 146, 154, 102, 152, 136, 156, 126, 109, 87, 127, 30, 195, 185, 171, 195, 208, 180, 190, 176, 189, 187, 171, 177, 159, 128, 144, 114, 139, 113, 52, 9, 44, 5, 8, 17, 5, 13, 8, 0, 5, 9, 0, 1, 2, 1, 2, 0, 7, 8, 1, 5, 5, 8, 14, 10, 4, 3, 3, 7, 11, 18, 19, 9, 1, 6, 2, 10, 8, 5, 1, 7, 0, 2, 1, 0, 0, 0, 10,
+#> 5, 34, 138, 104, 36, 148, 138, 153, 104, 150, 55, 45, 98, 59, 1, 0, 10, 18, 9, 3, 2, 0, 0, 5, 4, 0, 1, 3, 0, 0, 91, 171, 136, 163, 158, 188, 173, 158, 154, 145, 163, 121, 54, 141, 92, 96, 108, 103, 11, 5, 12, 15, 14, 22, 15, 27, 20, 13, 20, 17, 12, 3, 10, 16, 9, 6, 5, 2, 1, 10, 151, 131, 115, 64, 1, 9, 15, 97, 151, 21, 121, 68, 35, 127, 63, 78, 92, 0, 1, 1, 7, 159, 152, 171, 201, 140, 120, 111, 26, 209, 201, 190, 196, 173, 179, 198, 146, 125, 148, 121, 92, 26, 14, 1, 47, 168, 171, 134, 178, 154,
+#> 145, 156, 138, 107, 159, 148, 76, 104, 51, 157, 170, 167, 111, 190, 177, 160, 188, 193, 192, 148, 99, 48, 122, 78, 112, 0, 58, 36, 43, 0, 6, 1, 1, 0, 6, 15, 25, 9, 12, 14, 5, 0, 1, 0, 0, 0, 44, 38, 56, 57, 53, 39, 9, 10, 3, 1, 1, 6, 0, 3, 0, 0, 0, 0, 193, 175, 161, 152, 69, 164, 140, 152, 59, 90, 26, 18, 1, 104, 164, 165, 157, 159, 180, 187, 192, 156, 34, 88, 30, 32, 53, 64, 3, 60, 165, 179, 160, 189, 146, 115, 124, 95, 8, 11, 41, 0, 3, 2, 11, 16, 17, 14, 11, 19, 16, 8, 4, 0, 0, 2, 0, NA, 0, 0, 0,
+#> 0, 0, 11, 17, 11, 15, 9, 16, 9, 16, 14, 9, 0, 8, 7, 0, 2, 1, 10, 16, 1, 1, 5, 3, 0, 0, 150, 170, 15, 141, 161, 132, 108, 156, 164, 149, 115, 134, 1, 0, 2, 63, 113, 189, 192, 178, 201, 198, 192, 196, 187, 191, 175, 152, 166, 140, 117, 11, 128, 175, 138, 144, 150, 167, 137, 182, 152, 175, 142, 144, 117, 137, 113, 25, 78, 11, 7, 139, 200, 194, 170, 170, 167, 153, 190, 121, 172, 154, 112, 138, 141, 94, 124, 130, 119, 87, 79, 146, 7, 20, 10, 14, 17, 6, 15, 15, 8, 17, 10, 13, 8, 15, 0, 2, 11, 163, 176,
+#> 160, 169, 193, 179, 162, 142, 164, 98, 156, 162, 139, 158, 136, 143, 56, 16, 23, 22, 6, 19, 14, 15, 12, 6, 8, 6, 5, 2, 3, 0, 3, 0, 0, 142, 148, 148, 157, 166, 170, 140, 150, 154, 127, 182, 127, 164, 168, 173, 114, 112, 135, 166, 197, 149, 168, 138, 176, 208, 125, 174, 172, 182, 149, 113, 166, 144, 128, 86, 142, 107, 10, 28, 15, 140, 182, 144, 175, 174, 168, 194, 178, 176, 185, 139, 132, 47, 39, 3, 60, 7, 131, 189, 200, 198, 196, 223, 172, 197, 191, 201, 187, 181, 168, 184, 174, 164, 154, 162, 119,
+#> 118, 91, 109, 62, 0, 5, 9, 20, 16, 17, 11, 11, 12, 16, 17, 17, 13, 12, 8, 12, 4, 3, 0, 0, 4, 9, 7, 20, 16, 13, 24, 21, 16, 21, 9, 1, 3, 12, 0, 2, 6, 1, 0, 7, 17, 185, 185, 169, 161, 157, 175, 169, 142, 87, 32, 15, 7, 8, 74, 111, 78, 90, 96, 77, 111, 132, 90, 115, 134, 106, 95, 59, 17, 3, 167, 6, 160, 174, 182, 149, 172, 176, 168, 172, 184, 151, 19, 72, 7, 1, 0, 42, 132, 130, 147, 126, 126, 122, 90, 65, 94, 111, 115, 80, 4, 80, 128, 47, 128, 148, 143, 155, 170, 53, 143, 95, 74, 1, 15, 10, 8, 13, 16,
+#> 15, 13, 4, 1, 3, 3, 3, 0, 3, 6, 20, 14, 17, 13, 13, 23, 13, 12, 22, 19, 17, 5, 2, 2, 9, 3, 81, 76, 90, 118, 121, 79, 155, 138, 140, 172, 91, 105, 17, 39, 49, 0, 5, 11, 11, 8, 5, 12, 4, 4, 2, 0, 3, 4, 118, 190, 164, 121, 122, 62, 172, 167, 151, 177, 146, 55, 10, 10, 51, 87, 103, 149, 164, 122, 136, 153, 110, 132, 70, 141, 48, 2, 43, 159, 135, 146, 176, 159, 99, 78, 137, 156, 115, 16, 24, 23, 80, 30, 26, 0, 33, 138, 103, 145, 166, 185, 151, 117, 76, 83, 9, 9, 2, 62, 149, 156, 119, 147, 148, 155, 131,
+#> 161, 134, 163, 167, 127, 52, 84, 49, 12, 60, 56, 104, 112, 104, 74, 97, 116, 133, 158, 6, 104, 52, 45, 30, 25, 3, 28, 18, 12, 22, 2, 21, 11, 12, 17, 8, 13, 2, 0, 0, 12, 50, 2, 163, 147, 160, 158, 182, 153, 157, 148, 131, 146, 32, 15, 20, 123, 160, 176, 59, 100, 0, 188, 192, 169, 182, 191, 183, 161, 6, 14, 137, 183, 149, 147, 173, 69, 25, 0, 159, 23, 39, 2, 116, 172, 125, 166, 172, 158, 84, 114, 13, 120, 152, 109, 50, 42, 10, 7, 20, 0, 4, 3, 7, 14, 10, 16, 16, 10, 12, 6, 11, 11, 9, 5, 3, 0, 1, 0,
+#> 7, 6, 2, 2, 1, 0, 3, 4, 0, 0, 0, 1, 2, 15, 29, 19, 15, 33, 23, 10, 18, 20, 22, 25, 17, 15, 23, 10, 15, 22, 15, 6, 7, 3, 39, 121, 120, 177, 122, 80, 132, 10, 57, 105, 12, 13, 116, 130, 153, 129, 112, 127, 59, 41, 21, 2, 7, 149, 126, 136, 138, 143, 141, 102, 37, 128, 116, 43, 15, 68, 62, 89, 67, 158, 80, 149, 148, 126, 153, 157, 143, 91, 56, 102, 87, 104, 5, 41, 134, 80, 88, 23, 0, 1, 14, 10, 10, 9, 11, 16, 5, 2, 0, 0, 3, 11, 12, 16, 10, 12, 12, 16, 17, 5, 14, 5, 19, 20, 16, 3, 2, 10, 28, 110, 89,
+#> 175, 192, 192, 148, 194, 166, 167, 164, 154, 140, 168, 160, 139, 141, 159, 97, 46, 7, 2, 1, 20, 38, 14, 126, 139, 146, 145, 110, 117, 93, 18, 58, 145, 140, 125, 151, 122, 89, 62, 87, 35, 1, 10, 36, 84, 41, 99, 118, 141, 159, 151, 84, 144, 37, 81, 107, 79, 130, 7, 156, 157, 169, 199, 200, 191, 157, 159, 77, 92, 12, 109, 139, 142, 158, 175, 163, 186, 164, 199, 201, 186, 149, 152, 3, 12, 0, 0, 135, 132, 34, 109, 150, 138, 13, 116, 20, 51, 48, 27, 30, 4, 7, 3, 120, 79, 146, 114, 98, 149, 137, 133, 164,
+#> 175, 160, 153, 8, 70, 58, 73, 92, 143, 139, 127, 84, 166, 150, 129, 48, 80, 71, 153, 84, 27, 0, 6, 14, 9, 10, 10, 10, 2, 0, 7, 0, 4, 3, 3, 5, 1, 5, 6, 6, 3, 6, 5, 3, 1, 1, 1, 7, 19, 2, 1, 6, 4, 2, 2, 2, 0, 2, 1, 0, 0, 0, 4, 1, 2, 0, NA, 0, 9, 8, 10, 1, 2, 0, 0, 4, 1, 78, 45, 141, 116, 173, 209, 167, 181, 164, 153, 0, 16, 19, 9, 15, 10, 17, 25, 4, 8, 0, 0, 2, 1, 4, 10, 104, 92, 61, 99, 97, 111, 119, 102, 123, 91, 82, 95, 20, 121, 169, 114, 150, 128, 179, 201, 168, 192, 211, 194, 202, 209, 146, 175,
+#> 145, 178, 118, 26, 205, 187, 208, 181, 204, 166, 204, 178, 187, 135, 126, 164, 149, 133, 121, 112, 71, 63, 152, 173, 208, 159, 173, 186, 162, 186, 174, 129, 42, 141, 169, 17, 11, 9, 8, 5, 0, 0, 1, 0, 5, 13, 147, 184, 175, 201, 203, 179, 176, 185, 188, 205, 179, 191, 166, 113, 127, 74, 2, 25, 101, 193, 123, 133, 123, 124, 168, 118, 108, 135, 96, 128, 114, 95, 34, 4, 89, 116, 148, 151, 138, 169, 164, 162, 161, 170, 127, 42, 46, 23, 20, 15, 55, 110, 91, 127, 129, 4, 63, 58, 71, 112, 99, 98, 118, 74,
+#> 1, 42, 22, 21, 8, 0, 0, 2, 0, 3, 3, 7, 8, 15, 8, 3, 2, 1, 3, 13, 2, 5, 0, 0, 7, 2, 0, 3, 8, 4, 4, 0, 2, 6, 2, 5, 4, 2, 5, 1, 1, 2, 0, 0, 70, 29, 21, 127, 164, 160, 162, 152, 153, 105, 46, 9, 4, 1, 6, 1, 14, 3, 4, 6, 15, 20, 7, 7, 7, 3, 1, 0, 5, 9, 15, 15, 13, 16, 22, 16, 19, 39, 20, 12, 14, 3, 0, 2, 15, 18, 8, 14, 23, 23, 17, 12, 18, 15, 15, 13, NA, 0, 0, NA, 14, 10, 7, NA, 0, NA, 5, 3, 0, 0, 5, 172, 133, 111, 121, 91, 121, 144, 116, 70, 68, 76, 81, 61, 73, 9, 2, 178, 140, 131, 168, 125, 98, 99,
+#> 74, 26, 1, 1, 0, 0, 17, 20, 12, 9, 8, 3, 10, 16, 9, 7, 0, 0, 97, 128, 230, 181, 163, 15, 98, 174, 122, 19, 123, 11, 60, 58, 71, 21, 7, 169, 181, 130, 58, 5, 2, 6, 0, 5, 9, 11, 11, 8, 11, 4, 3, 1, 0, 3, 2, 6, 5, 0, 1, 1, 0, 0, 1, 4, 3, 5, 2, 0, 3, 7, 3, 1, 2, 0, 0, 0, 0, 0, 0, 1, 0, 2, 0, 6, 6, 7, 5, 6, 7, 7, 20, 9, 155, 191, 183, 164, 154, 165, 189, 162, 154, 186, 129, 120, 160, 155, 146, 146, 165, 145, 140, 100, 83, 126, 101, 9, 6, 143, 137, 162, 171, 182, 135, 116, 79, 49, 20, 37, 27, 115, 128,
+#> 119, 99, 54, 43, 55, 115, 101, 74, 89, 61, 26, 0, 1, 110, 53, 94, 108, 188, 200, 211, 191, 167, 172, 186, 173, 7, 2, 76, 90, 60, 90, 21, 69, 12, 74, 116, 68, 4, 0, 0, 1, 0, 21, 25, 13, 19, 21, 15, 12, 20, 26, 6, 170, 139, 209, 205, 176, 210, 218, 205, 192, 198, 230, 185, 210, 215, 204, 198, 208, 185, 140, 172, 121, 35, 72, 107, 52, 33, 157, 154, 131, 149, 126, 93, 124, 57, 70, 131, 56, 4, 30, 4, 7, 21, 20, 14, 17, 28, 14, 20, 15, 5, 14, 10, 13, NA, 0, 19, 18, 75, 121, 181, 178, 179, 162, 169, 145,
+#> 97, 131, 126, 61, 71, 24, 3, 5, 13, 20, 18, 15, 25, 20, 8, 16, 29, 33, 15, 20, 12, 17, 5, 0, 4, 12, 7, 7, 2, 3, 5, 1, 3, 0, 0, 108, 156, 152, 86, 103, 101, 43, 11, 26, 57, 84, 117, 12, 15, 4, 15, 24, 7, 1, 87, 164, 137, 187, 185, 173, 175, 176, 142, 166, 148, 148, 140, 143, 83, 17, 61, 98, 55, 47, 79, 39, 5, 93, 5, 6, 4, 3, 217, 185, 191, 161, 136, 197, 204, 164, 9, 166, 131, 123, 26, 7, 201, 187, 166, 142, 137, 126, 128, 162, 156, 79, 139, 97, 80, 41, 68, 118, 114, 160, 90, 160, 168, 126, 24, 19,
+#> 8, 4, 16, 22, 9, 6, 132, 122, 156, 134, 133, 156, 108, 160, 147, 62, 153, 143, 127, 100, 60, 74, 62, 6, 51, 170, 140, 167, 154, 171, 150, 151, 167, 81, 79, 29, 42, 60, 50, 31, 16, 7, 4, 145, 144, 47, 138, 102, 132, 125, 103, 145, 112, 124, 108, 4, 1, 113, 62, 147, 193, 152, 172, 132, 115, 174, 203, 230, 157, 149, 149, 89, 95, 9, 4, 14, 6, 1, 6, 1, 6, 13, 0, 1, 0, 0, 4, 73, 156, 101, 115, 146, 142, 128, 95, 143, 98, 89, 132, 105, 64, 33, 61, 173, 133, 150, 160, 145, 97, 106, 162, 145, 146, 123, 42,
+#> 25, 24, 120, 107, 134, 90, 137, 57, 7, 22, 5, 20, 136, 149, 129, 69, 65, 79, 95, 34, 42, 87, 79, 137, 121, 56, 44, 11, 1, 129, 144, 149, 85, 100, 27, 22, 5, 0, 50, 10, 3, 5, 11, 16, 15, 8, 13, 6, 10, 15, 15, 5, 4, 2, 5, 2, 0, 1, 2, 9, 13, 11, 8, 13, 18, 16, 16, 16, NA, 0, 2, 61, 2, 2, 130, 177, 130, 81, 71, 121, 147, 154, 49, 114, 6, 3, 23, 34, 6, 129, 5, 9, 74, 115, 145, 153, 125, 103, 160, 125, 151, 145, 156, 153, 136, 110, 51, 115, 119, 53, 17, 17, 0, 3, 1, 6, 5, 3, 4, 2, 0, 1, 0, 0, 1, 1, 2,
+#> 0, NA, 1, 4, 2, 4, 1, 2, 0, 3, 2, 0, 1, 0, 2, 0, 3, 0, 1, 0, 105, 125, 137, 125, 123, 14, 79, 92, 33, 23, 3, 4, 2, 3, 172, 124, 80, 153, 182, 121, 96, 48, 11, 11, 44, 126, 173, 158, 116, 70, 104, 79, 86, 32, 0, 16, 154, 136, 146, 129, 136, 141, 134, 156, 126, 28, 24, 16, 0, 1, 97, 130, 123, 117, 141, 97, 137, 162, 156, 107, 117, 98, 91, 129, 63, 10, 4, 109, 131, 63, 82, 75, 63, 28, 51, 21, 4, 4, 12, 15, 15, 14, 8, 15, 20, 20, 10, 6, 1, 46, 68, 85, 120, 177, 159, 105, 165, 218, 157, 210, 134, 156,
+#> 133, 2, 90, 10, 66, 0, 0, 0, 2, 1, 1, 1, 0, 1, 0, 0, 0, 0, 0, 1, 1, 3, 13, 9, 13, 1, 3, 1, 3, 0, 1, 0, 0, 1, 0, 2, 73, 68, 174, 176, 185, 186, 164, 146, 177, 158, 144, 137, 158, 158, 132, 161, 77, 51, 61, 33, 60, 51, 1, 114, 141, 54, 146, 182, 183, 206, 184, 195, 202, 200, 193, 193, 194, 163, 150, 133, 66, 123, 8, 5, 14, 11, 4, 4, 9, 10, 8, 9, 1, 11, 5, 6, 0, 0, 6, 12, 7, 16, 15, 3, 8, 1, 3, 14, 10, 6, 9, 1, 4, 0, 147, 171, 60, 139, 142, 141, 154, 185, 170, 176, 166, 157, 96, 35, 39, 14, 0, 85, 84,
+#> 162, 89, 178, 128, 135, 111, 140, 144, 96, 74, 43, 22, 21, 1, 0, 55, 129, 120, 102, 112, 131, 196, 146, 119, 0, 1, 124, 144, 125, 133, 61, 7, 78, 83, 17, 37, 3, 0, 150, 126, 152, 70, 177, 170, 203, 218, 192, 200, 239, 188, 130, 179, 111, 167, 160, 97, 124, 11, 15, 11, 17, 18, 13, 15, 7, 17, 7, 12, 5, 9, 12, 6, 11, 6, 10, 0, 0, NA, NA, 4, 2, 16, 117, 134, 113, 149, 139, 110, 134, 47, 132, 60, 36, 88, 7, 23, 8, 15, 43, 54, 36, 33, 1, 61, 49, 155, 107, 148, 146, 133, 156, 82, 148, 106, 145, 102, 93,
+#> 23, 11, 0, 7, 0, 14, 16, 15, 14, 28, 20, 10, 1, NA, NA, NA, 0, 0, NA, NA, 10, 13, 1, 1, 1, 2, 7, 5, 9, 12, 8, 8, 11, 15, 6, NA, NA, NA, 7, 0, 0, 1, 5, 4, 17, 10, 18, 17, 2, 6, 2, 0, 4, 139, 148, 168, 176, 175, 126, 128, 160, 144, 63, 37, 150, 132, 64, 100, 7, 99, 3, 28, 68, 70, 151, 139, 143, 117, 102, 147, 87, 42, 55, 51, 40, 147, 188, 167, 189, 158, 170, 181, 128, 95, 44, 6, 14, 155, 156, 177, 134, 145, 141, 174, 150, 109, 136, 102, 128, 90, 55, 103, 79, 42, 12, 6, 12, 96, 108, 116, 65, 80, 80,
+#> 9, 61, 4, 41, 10, 4, 2, 1, 4, 5, 11, 12, 14, 0, NA, 0, 0, 0, 5, NA, 1, 1, 1, 1, NA, 0, 52, 27, 115, 47, 62, 16, 53, 16, 147, 10, 115, 11, 32, 14, 13, 140, 138, 110, 146, 133, 113, 130, 77, 130, 71, 169, 105, 1, 150, 42, 32, 25, 180, 74, 0, 2, 7, 6, 15, 6, 11, 8, 14, 12, 12, NA, NA, 4, 2, 62, 146, 134, 157, 181, 168, 159, 158, 151, 155, 146, 120, 28, 32, 110, 22, 0, 0, 0, 0, 0, 0, 1, 2, 0, 2, 5, 17, NA, 0, 0, NA, NA, NA, 1, 57, 81, 40, 29, 13, 47, 53, 25, 0, 0, 0, 0, 8, 13, 11, 12, 10, 11, 11, NA,
+#> NA, NA, NA, NA, 8, 129, 126, 122, 143, 149, 144, 83, 151, 114, 1, 50, 15, 17, 1, 3, 32, 98, 152, 100, 133, 53, 106, 111, 100, 141, 83, 74, 33, 61, 23, 12, 25, 32, 165, 174, 183, 167, 128, 185, 139, 191, 150, 78, 19, 28, 0, 20, 95, 113, 154, 140, 111, 129, 120, 140, 62, 124, 117, 24, 0, 0, 139, 163, 125, 179, 128, 158, 39, 92, 112, 148, 137, 92, 44, 80, 43, 26, 160, 104, 126, 116, 147, 126, 135, 64, 146, 77, 23, 82, 5, 21, 138, 151, 101, 157, 132, 158, 146, 150, 138, 150, 140, 138, 154, 79, 146, 77,
+#> 117, 116, 101, 74, 1, 75, 124, 127, 95, 159, 152, 139, 125, 87, 121, 96, 51, 0, 4, 11, 12, 17, 16, 17, 23, 16, 25, 14, 20, 26, 25, 21, 19, 9, 22, 19, 16, 5, NA, 7, 2, NA, NA, NA, 1, 62, 57, 11, 66, 75, 183, 186, 185, 231, 201, 192, 34, 127, 147, 3, 16, 2, 11, 136, 101, 151, 164, 140, 161, 92, 88, 130, 12, 8, 1, 1, 3, 2, 3, 2, 1, 0, 2, 1, 0, 0, 0, 0, 0, 1, 2, 1, 1, 2, NA, 0, NA, 0, 0, 11, 67, 155, 129, 184, 171, 119, 150, 31, 51, 114, 65, 26, 15, 22, 12, 11, 0, 11, 2, 9, 13, 8, 6, 16, 24, 17, 11,
+#> NA, NA, NA, 0, 13, 98, 140, 121, 47, 21, 94, 98, 107, 131, 116, 34, 85, 61, 9, 35, 17, 1, 0, 20, 138, 134, 110, 126, 40, 19, 83, 63, 12, 12, 2, 1, 12, 103, 120, 117, 127, 69, 128, 66, 118, 118, 64, 8, 54, 89, 140, 145, 118, 131, 146, 137, 100, 121, 46, 75, 117, 140, 148, 100, 129, 149, 59, 7, 22, 137, 113, 143, 156, 135, 190, 186, 183, 183, 110, 0, 15, 14, 7, 17, 10, 15, 8, 0, 4, 4, 8, 12, 12, 15, 13, 16, 13, 13, 7, NA, 2, NA, 0, 3, 4, 10, 10, 11, 14, 4, 0, NA, NA, NA, 13, 16, 67, 64, 194, 186, 171,
+#> 94, 95, 129, 71, 2, 15, 4, 0, 3, 12, 2, 0, 0, NA, NA, 0, 6, 10, 5, 7, NA, NA, 4, 4, 13, 14, 176, 167, 158, 175, 157, 116, 165, 120, 145, 170, 99, 100, 136, 93, 16, 78, 161, 200, 178, 162, 182, 145, 143, 100, 156, 25, 126, 148, 47, 35, 28, 86, 171, 126, 180, 133, 177, 146, 161, 155, 181, 198, 178, 171, 180, 102, 42, 132, 14, 4, 22, 137, 88, 98, 137, 138, 90, 92, 75, 16, 84, 48, 22, 20, 49, 114, 136, 156, 22, 97, 171, 188, 172, 171, 155, 170, 110, 144, 125, 100, 40, 38, 0, 7, 129, 146, 109, 105, 92,
+#> 39, 45, 84, 19, 17, 99, 158, 168, 137, 144, 89, 100, 5, 124, 127, 152, 147, 103, 32, 39, 9, 12, 146, 146, 175, 171, 187, 166, 157, 138, 147, 140, 49, 72, 80, 31, 32, 4, 19, 47, 109, 156, 70, 84, 45, 45, 32, 36, 29, 20, 1, 5, 7, 1, 13, 17, 20, 22, NA, NA, NA, NA, NA, NA, NA, 0, NA, NA, NA, NA, 0, 25, 116, 162, 169, 153, 154, 168, 147, 149, 152, 137, 148, 137, 116, 54, 16, 28, 26, 139, 158, 170, 155, 166, 171, 158, 113, 157, 58, 17, 12, 0, 0, 2, 0, 3, 0, 1, NA, NA, NA, NA, 0, NA, 0, 7, 2, 6, 17, 13,
+#> 15, 5, 3, 1, 0, 4, 1, 3, 0, 0, 0, 6, 7, 163, 121, 136, 5, 126, 147, 149, 161, 167, 150, 163, 151, 150, 104, 109, 112, 74, 134, 93, 89, 6, 32, 49, 51, 132, 102, 127, 104, 102, 90, 122, 70, 30, 32, 11, 3, 4, 3, 10, 16, 13, 11, 14, 14, 10, 17, NA, NA, 0, NA, NA, NA, 8, 6, NA, NA, 12, NA, NA, 0, 7, 118, 122, 101, 83, 69, 24, 0, 0, 15, 134, 125, 56, 87, 124, 169, 162, 87, 138, 89, 127, 141, 83, 129, 101, 116, 70, 110, 129, 111, 43, 10, 1, 22, 117, 100, 82, 133, 60, 36, 153, 164, 120, 105, 122, 111, 11,
+#> 18, 0, 110, 161, 179, 168, 164, 144, 171, 148, 54, 123, 154, 83, 142, 77, 105, 53, 33, 18, 137, 162, 145, 94, 184, 178, 155, 175, 192, 130, 144, 102, 123, 133, 87, 48, 2, 3, 10, 9, 8, 7, 17, 3, NA, NA, NA, NA, NA, NA, 8, 32, 23, 108, 137, 181, 118, 174, 130, 135, 64, 127, 80, 88, 22, 41, 0, 21, 12, 37, 7, 135, 75, 12, 4, 15, 2, 141, 151, 135, 125, 132, 112, 125, 3, 126, 78, 103, 69, 136, 67, 7, 6, 21, 53, 44, 79, 37, 9, 2, 1, 2, 0, 3, 4, NA, 0, NA, 0, 0, NA, 0, 0, NA, 2, NA, 1, 0, 0, 3, 1, 0, 6,
+#> 6, 1, 1, 2, 3, 3, 0, NA, NA, 1, 0, 69, 156, 153, 149, 177, 142, 168, 143, 150, 150, 153, 135, 137, 140, 50, 56, 1, 53, 21, 46, 20, 9, 128, 146, 153, 136, 138, 44, 122, 157, 135, 107, 132, 113, 93, 116, 84, 2, 17, 26, 86, 95, 89, 116, 87, 4, 50, 19, 35, 82, 25, 29, 12, 6, 7, 24, 22, 0, 132, 142, 145, 145, 102, 101, 50, 27, 61, 65, 2, 0, 0, 2, 3, 6, 0, 0, NA, NA, NA, 0, NA, NA, NA, NA, 4, 120, 63, 94, 113, 164, 27, 162, 205, 107, 147, 104, 93, 19, 18, 162, 161, 119, 164, 157, 135, 192, 159, 108, 173,
+#> 115, 143, 70, 96, 11, 28, 0, 0, 32, 25, 150, 142, 100, 161, 138, 125, 129, 127, 124, 72, 45, 9, 7, 25, 152, 171, 132, 146, 126, 170, 121, 129, 132, 145, 154, 117, 50, 13, 0, 9, 7, 10, 15, 21, 9, 16, 0, 0, 0, NA, NA, NA, 2, NA, 10, 6, 14, 63, 106, 167, 137, 138, 24, 57, 117, 133, 142, 147, 92, 119, 145, 93, 125, 122, 128, 91, 57, 0, 3, 3, 10, 12, 16, 4, 0, 48, 72, 48, 118, 163, 149, 52, 152, 176, 179, 170, 123, 61, 136, 111, 70, 44, 54, 2, 7, 0, 1, 3, 3, 8, 8, 1, 1, 0, 1, NA, 0, 0, 0, 0, 1, 25, 51,
+#> 79, 106, 200, 210, 200, 192, 202, 204, 200, 122, 176, 114, 175, 184, 142, 16, 10, 115, 110, 127, 69, 47, 133, 73, 116, 12, 87, 61, 6, 9, 18, 19, 19, 18, 36, 23, 1, 0, NA, 0, NA, NA, NA, 2, 9, 18, 70, 68, 133, 129, 149, 131, 67, 85, 37, 29, 32, 18, 2, 12, 11, 16, 10, 15, 23, 17, 12, 4, NA, 2, 69, 67, 79, 94, 167, 139, 162, 155, 170, 166, 162, 129, 164, 123, 130, 141, 81, 89, 39, 66, 15, 158, 78, 66, 96, 29, 42, 2, 42, 12, 147, 167, 132, 143, 157, 147, 89, 73, 81, 79, 108, 15, 49, 134, 157, 155, 160,
+#> 124, 110, 24, 179, 102, 160, 134, 94, 81, 19, 173, 124, 91, 95, 32, 127, 163, 171, 60, 31, 67, 7, 72, 160, 140, 153, 149, 129, 137, 157, 112, 144, 136, 146, 152, 160, 153, 97, 30, 4, 9, 8, 12, 19, 14, 8, NA, NA, 3, 7, 108, 168, 146, 168, 154, 134, 132, 130, 111, 147, 69, 2, 10, 0, 0, NA, NA, 9, 4, 0, 0, 0, 0, 4, 2, 0, 0, 0, 5, 4, 7, 6, 0, 0, 0, 0, 1, 2, 1, 5, 0, 0, NA, NA, 27, 142, 182, 174, 161, 138, 102, 65, 137, 95, 181, 153, 102, 41, 100, 106, 91, 11, 5, 6, 4, 18, 7, 19, 13, 3, 6, NA, 0, 0, 0,
+#> NA, NA, NA, NA, 3, NA, 18, 175, 159, 129, 161, 177, 125, 56, 141, 119, 140, 118, 114, 100, 76, 20, 85, 47, 28, 100, 157, 159, 154, 153, 133, 162, 141, 56, 0, 122, 187, 153, 109, 7, 175, 167, 172, 154, 142, 85, 117, 89, 68, 52, 3, 7, 6, 8, 13, 11, 7, 0, 12, 8, 0, 1, 4, 7, 8, 6, 4, 7, 1, 1, 5, NA, 1, NA, NA, NA, 1, 17, 50, 129, 156, 141, 129, 139, 155, 148, 150, 162, 132, 79, 85, 94, 123, 90, 115, 77, 37, 16, 18, 174, 164, 206, 213, 201, 148, 128, 177, 191, 184, 159, 200, 112, 128, 49, 0, 88, 97, 120,
+#> 149, 153, 152, 142, 103, 147, 150, 105, 183, 140, 55, 107, 63, 8, 10, 11, 6, 5, 15, 15, 3, 2, 4, 2, 30, 158, 174, 82, 179, 162, 171, 143, 114, 84, 100, 170, 128, 98, 1, 132, 149, 149, 176, 191, 198, 176, 143, 175, 170, 159, 209, 130, 204, 184, 29, 101, 20, 47, 40, 62, 172, 168, 215, 194, 193, 153, 62, 66, 154, 173, 198, 174, 149, 97, 146, 176, 108, 12, 0, 0, NA, NA, NA, 5, NA, NA, 0, NA, NA, NA, 4, 0, 0, 0, 0, NA, 0, NA, NA, 0, 0, 0, 0, 0, 0, 4, 3, 0, 0, NA, NA, 0, 0, 1, 2, 6, 86, 28, 29, 11, 73,
+#> 139, 172, 197, 170, 133, 144, 122, 136, 145, 149, 119, 11, 53, 31, 54, 130, 17, 135, 153, 142, 123, 127, 124, 115, 67, 102, 87, 36, 35, 18, 62, 8, 4, 91, 94, 102, 132, 144, 136, 138, 94, 118, 76, 91, 90, 91, 28, 13, 26, 29, 15, 63, 130, 113, 121, 66, 123, 134, 123, 122, 178, 112, 186, 162, 137, 165, 164, 148, 111, 73, 137, 161, 57, 149, 145, 110, 88, 152, 54, 86, 85, 47, 52, 26, 0, 5, 10, 10, 8, 12, 9, 17, 10, 10, 15, 6, 7, 14, 8, 0, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 15, 10, 11, 15,
+#> 13, 19, 13, 10, 18, 11, 7, 11, 6, 11, 5, 7, 11, NA, NA, NA, NA, NA, NA, NA, 2, NA, NA, 0, 0, NA, NA, NA, NA, NA, 1, 1, 0, 2, 0, 0, 0, 1, 0, 1, 2, NA, 0, 0, NA, 0, NA, NA, NA, NA, 0, 0, 0, 0, 0, 0, 0, 7, 3, 6, 3, 2, 2, 6, 3, 2, 2, 0, 5, 129, 195, 215, 176, 150, 212, 175, 109, 166, 144, 107, 184, 128, 124, 180, 129, 179, 129, 169, 149, 10, 41, 89, 27, 79, 167, 147, 175, 191, 170, 113, 145, 106, 189, 183, 96, 83, 70, 10, NA, NA, 0, 0, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 0, 0,
+#> NA, 9, 8, 71, 34, 45, 133, 175, 184, 184, 148, 82, 74, 210, 114, 16, 88, 94, 0, 6, 153, 131, 145, 160, 24, 158, 135, 71, 156, 156, 96, 46, 4, 132, 11, 10, 1, 9, 14, 136, 118, 71, 98, 125, 123, 114, 110, 48, 121, 120, 91, 114, 98, 94, 104, 111, 28, 33, 57, 141, 189, 186, 177, 120, 160, 123, 134, 140, 109, 120, 90, 60, 114, 48, 14, 62, 13, 29, 24, 31, 45, 76, 102, 116, 127, 124, 148, 91, 156, 143, 130, 140, 154, 138, 126, 107, 52, 17, 24, 104, 74, 122, 114, 123, 36, 54, 30, 52, 96, 119, 125, 103, 41,
+#> 23, 17, 65, 91, 154, 189, 133, 152, 27, 113, 66, 151, 73, 145, 120, 15, 2, 0, 7, 14, 143, 174, 147, 129, 93, 155, 137, 152, 170, 128, 171, 138, 71, 92, 58, 173, 174, 179, 186, 111, 174, 178, 180, 173, 151, 171, 171, 147, 184, 150, 144, 174, 110, 141, 59, 88, 35, 2, 20, 148, 154, 176, 178, 119, 183, 189, 132, 135, 141, 178, 179, 105, 164, 153, 150, 126, 70, 58, 16, 10, 115, 151, 139, 155, 151, 83, 155, 117, 162, 137, 136, 137, 93, 155, 26, 75, 141, 72, 4, 128, 83, 15, 148, 146, 80, 158, 165, 151,
+#> 27, 17, 20, 4, 0, 5, 3, 8, 6, 13, 0, NA, NA, NA, NA, NA, NA, 6, 11, 10, 5, 6, 7, 6, 4, 4, NA, NA, NA, NA, NA, 109, 146, 157, 194, 155, 174, 179, 126, 7, 34, 0, 77, 43, 1, 3, 69, 155, 180, 192, 163, 193, 159, 164, 148, 127, 150, 82, 145, 185, 110, 144, 32, 49, 21, 6, 9, 19, 16, 19, 18, 10, 13, 13, 2, NA, 1, 7, 10, 11, 9, 2, 8, 10, 4, 0, 62, 200, 181, 211, 161, 96, 139, 121, 127, 154, 126, 113, 90, 129, 125, 50, 11, 29, 136, 159, 138, 118, 92, 99, 128, 54, 27, 32, 99, 3, 0, 0, 0, 0, 0, 0, NA, NA, 0,
+#> 0, NA, NA, NA, 0, 11, 21, 115, 73, 21, 76, 48, 125, 125, 113, 92, 104, 75, 32, 15, 10, 47, 108, 163, 138, 210, 191, 115, 173, 98, 62, 171, 183, 171, 170, 96, 50, 26, 9, 147, 141, 162, 103, 142, 163, 154, 139, 44, 109, 137, 4, 59, 78, 47, 23, 10, 12, 85, 149, 165, 151, 98, 16, 35, 97, 65, 8, 0, 1, 0, 7, 8, 20, 12, 14, 18, 10, 20, 17, 18, 19, 27, 24, 12, 4, 17, 12, NA, NA, NA, 0, NA, NA, 8, 138, 121, 111, 88, 160, 206, 161, 170, 157, 160, 111, 128, 112, 131, 126, 111, 97, 73, 86, 153, 124, 83, 130,
+#> 117, 31, 129, 141, 53, 115, 63, 105, 155, 182, 172, 166, 156, 186, 70, 163, 145, 162, 176, 173, 175, 58, 23, 102, 51, 53, 34, 19, 12, 86, 149, 161, 174, 147, 154, 179, 103, 210, 178, 186, 129, 163, 198, 190, 195, 145, 131, 147, 117, 4, 23, 104, 181, 144, 124, 103, 154, 132, 65, 124, 55, 120, 120, 110, 89, 120, 54, NA, NA, NA, NA, NA, 0, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 0, NA, 0, 3, 1, 3, 1, 0, 1, 0, 0, 0, 0, 0, 13, 4, 24, 114, 95, 127, 193, 127, 182, 219, 133, 205, 203, 166, 185, 140,
+#> 62, 119, 169, 111, 150, 170, 140, 157, 200, 161, 106, 159, 171, 174, 54, 74, 158, 148, 10, 68, 15, 13, 106, 146, 109, 129, 152, 94, 57, 136, 11, 74, 71, 24, 3, 5, 135, 139, 141, 144, 112, 155, 100, 149, 87, 32, 102, 101, 45, 63, 41, 8, 39, 132, 136, 139, 169, 181, 184, 154, 114, 151, 169, 193, 174, 148, 158, 180, 114, 13, 149, 169, 148, 74, 22, 4, 0, 81, 116, 133, 148, 147, 141, 151, 186, 85, 90, 160, 162, 129, 110, 139, 81, 14, 58, 7, 79, 109, 17, 35, 114, 133, 120, 54, 161, 143, 159, 109, 92, 10,
+#> NA, NA, NA, NA, 0, 0, NA, NA, NA, 0, NA, NA, 0, NA, NA, 112, 165, 102, 99, 156, 12, 1, 6, 2, 179, 166, 81, 130, 132, 101, 166, 169, 130, 63, 125, 97, 85, 35, 20, 0, 0, 21, 4, 2, NA, NA, 14, NA, 10, 11, 12, 12, 10, 0, 3, NA, NA, 3, 15, 7, 89, 104, 95, 81, 117, 138, 155, 104, 39, 86, 116, 98, 53, 41, 31, 52, 73, 139, 169, 141, 176, 151, 176, 147, 168, 177, 101, 141, 140, 78, 57, 104, 29, 135, 160, 168, 135, 44, 2, 125, 124, 23, 50, 100, 113, 85, 32, 106, 62, 78, 116, 113, 7, 6, 44, 40, 105, 153, 71,
+#> 78, 109, 49, 147, 141, 118, 1, 33, 118, 121, 196, 168, 120, 158, 98, 38, 92, 17, 13, 84, 9, 6, 1, 6, 13, 4, 3, 1, 0, 3, 5, 7, 9, 10, 22, 9, 8, 8, 11, 17, NA, NA, NA, NA, NA, 3, 4, 1, 4, 4, 4, 2, 4, 1, 2, 1, 4, 0, 1, 2, 0, 0, 1, 1, 0, 4, 0, 7, 8, 3, NA, NA, NA, 0, NA, 10, 99, 157, 98, 129, 107, 143, 122, 83, 51, 36, 34, 1, 11, 43, 185, 230, 133, 194, 159, 163, 168, 170, 170, 155, 97, 89, 70, 107, 57, 5, 0, NA, 0, 0, NA, NA, NA, 0, NA, 0, 8, 120, 127, 168, 101, 126, 161, 174, 156, 159, 205, 145, 109,
+#> 170, 93, 28, 132, 78, 60, 45, 34, 62, 8, 54, 126, 135, 113, 72, 47, 57, 107, 89, 13, 1, 11, 136, 68, 148, 136, 143, 145, 94, 163, 146, 175, 156, 125, 123, 110, 28, 62, 61, 62, 152, 124, 140, 100, 121, 134, 106, 148, 144, 182, 155, 162, 130, 157, 153, 157, 100, 31, 64, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 0, 1, 0, 131, 29, 12, 1, 0, 0, 1, 0, NA, NA, NA, NA, 0, NA, NA, NA, 9, 63, 136, 158, 85, 138, 163, 137, 150, 84, 114, 91, 103, 126, 87, 19, 45, 4, 34, 36, 10, 61, 32, 68, 95, 87, 118, 142, 145,
+#> 180, 97, 147, 115, 121, 99, 98, 27, 22, 118, 138, 145, 146, 168, 27, 110, 148, 173, 112, 145, 168, 122, 5, 59, 77, 39, 31, 7, 24, 11, 12, 15, 8, 23, 5, 15, 13, 4, 11, 13, 17, 1, 7, 4, 3, 2, 20, 63, 112, 144, 57, 68, 54, 25, 61, 56, 69, 71, 72, 42, 62, 17, 1, 0, 0, NA, NA, NA, NA, NA, 4, 8, 12, 4, 2, NA, 2, 3, 8, 3, 0, 0, 0, 3, 0, 0, 0, 3, 0, 10, 124, 151, 160, 139, 136, 150, 137, 140, 90, 141, 160, 121, 116, 70, 23, 0, 16, 16, 17, 15, 21, 24, 13, 8, 12, 21, NA, NA, 3, 8, 9, 3, 1, 15, 0, 42, 78, 97,
+#> 78, 52, 34, 15, 0, 96, 179, 135, 143, 150, 147, 172, 160, 104, 169, 58, 90, 159, 126, 112, 104, 35, 77, 122, 112, 21, 79, 128, 138, 21, 77, 86, 40, 15, 0, 9, 9, 3, 0, 9, 6, 11, 10, 11, 4, 8, 3, 8, 1, NA, NA, NA, NA, NA, NA, NA, NA, 0, NA, 0, NA, 0, 1, 1, NA, NA, NA, 133, 188, 157, 134, 145, 92, 179, 111, 168, 160, 155, 185, 136, 1, 130, 2, 87, 51, 69, 175, 115, 125, 125, 171, 102, 112, 16, 100, 52, NA, NA, 0, 0, NA, NA, 0, NA, 0, NA, 0, 0, NA, NA, NA, NA, NA, NA, 5, 15, 59, 104, 175, 174, 162, 156,
+#> 15, 184, 64, 40, 177, 140, 116, 32, 29, 34, 84, 103, 77, 99, 44, 67, 48, 18, 48, 68, 45, 25, 27, NA, NA, NA, 8, 12, 13, NA, NA, NA, NA, NA, 17, 24, 120, 106, 160, 91, 168, 178, 176, 185, 163, 167, 134, 131, 81, 57, 137, 10, 6, 5, 158, 211, 195, 181, 177, 157, 152, 166, 150, 210, 160, 165, 140, 144, 178, 166, 163, 113, 79, 114, 33, 180, 175, 138, 136, 210, 171, 175, 205, 160, 198, 134, 28, 6, 8, 10, 151, 63, 185, 161, 180, 169, 119, 7, 55, 2, 0, 42, 103, 135, 146, 97, 122, 91, 173, 104, 147, 104,
+#> 131, 106, 2, 82, 95, 168, 87, 132, 153, 127, 120, 16, 11, 1, 20, 10, 19, 3, 24, 2, 9, 5, 4, 1, 3, 9, 15, 9, 6, NA, 7, 0, 4, 2, 0, 0, NA, NA, NA, NA, NA, NA, NA, NA, NA, 29, 12, 43, 45, 111, 136, 150, 94, 139, 82, 30, 17, 104, 26, 33, 0, 0, 0, 0, NA, NA, NA, 0, 0, 0, NA, NA, NA, NA, NA, 0, 0, 5, 101, 57, 182, 158, 126, 115, 25, 146, 42, 27, 152, 142, 97, 39, 5, 57, 12, 4, 11, 13, 11, 10, 8, 12, 13, 8, 11, 12, 7, 2, NA, NA, NA, 0, 0, 0, NA, 0, NA, NA, NA, NA, NA, NA, NA, 3, 0, 4, 8, 2, 26, 38, 37,
+#> 5, 61, 114, 88, 95, 54, 88, 80, 76, 92, 68, 25, 42, 27, 25, 34, 1, NA, 0, NA, NA, 0, 0, 4, 6, 0, 10, 15, 5, 13, 9, NA, NA, NA, 1, 13, 9, 10, 12, 1, 172, 165, 200, 186, 178, 154, 163, 176, 188, 170, 186, 141, 53, 135, 118, 9, 63, 147, 163, 156, 136, 147, 82, 133, 110, 129, 107, 99, 55, 33, 69, 34, 11, 4, 125, 172, 166, 216, 127, 177, 164, 47, 31, 168, 155, 141, 143, 44, 57, 95, 90, 68, 68, 2, 24, 13, 175, 163, 100, 179, 154, 62, 26, 59, 145, 144, 65, 0, 0, 1, 1, 2, 0, 0, NA, 0, 2, NA, NA, 7, 132,
+#> 100, 87, 63, 19, 44, 58, 51, 10, 68, 9, 108, 131, 109, 123, 151, 146, 107, 150, 134, 37, 14, 22, 24, 53, 3, 73, 16, 118, 210, 203, 240, 207, 200, 214, 205, 187, 181, 133, 169, 125, 149, 156, 103, 122, 88, 89, 88, 115, 170, 166, 151, 149, 167, 113, 111, 107, 68, 25, 182, 163, 173, 163, 174, 44, 129, 184, 153, 112, 5, 31, 63, 115, 166, 156, 127, 139, 114, 128, 60, 85, 84, 40, 6, 80, 78, 92, 42, 81, 133, 173, 178, 161, 185, 109, 157, 189, 187, 163, 133, 88, 16, 19, 68, 26, 137, 177, 6, 63, 69, 14, 68,
+#> 118, 141, 136, 68, 66, 42, 75, 107, 85, 132, 136, 93, 102, 94, 117, 75, 26, 2, 5, 8, 1, 1, 6, 9, 9, 5, 4, 1, 6, NA, 3, NA, 0, 1, 95, 179, 183, 192, 184, 194, 175, 116, 148, 131, 163, 162, 127, 102, 143, 57, 87, 93, 29, 3, 24, 17, 0, 0, 1, 1, 1, 0, 0, 0, NA, NA, NA, 0, 0, 0, NA, 0, NA, NA, NA, 0, 0, 9, 46, 95, 74, 91, 150, 167, 118, 135, 157, 54, 82, 109, 11, 105, 91, 59, 1, 0, 2, 4, 0, 0, 1, 5, 0, 0, 0, 0, NA, NA, 4, 3, 92, 51, 149, 119, 73, 63, 48, 32, 8, 10, 3, 5, 5, 0, 0, 15, 6, 11, 10, NA, NA,
+#> 4, 161, 166, 130, 171, 141, 152, 140, 102, 26, 14, 21, 7, 14, 16, 8, 14, 15, 19, 14, 2, NA, 0, 0, 1, 0, 0, 0, 55, 94, 213, 197, 211, 218, 163, 203, 177, 168, 165, 175, 165, 197, 159, 220, 148, 139, 41, 33, 1, 2, 20, 18, 7, 1, 15, 9, 22, 13, 28, 14, 25, NA, 0, 6, 2, 79, 207, 211, 238, 186, 186, 191, 101, 169, 184, 154, 113, 132, 2, 11, 3, NA, 6, 0, NA, NA, 0, 0, NA, NA, NA, NA, 0, NA, NA, 3, 5, 10, 1, 4, 0, 0, 0, 0, 1, 25, 90, 114, 139, 82, 96, 114, 101, 61, 26, 6, 2, 50, 160, 156, 143, 148, 112,
+#> 177, 152, 159, 185, 130, 120, 106, 116, 87, 45, 37, 0, 0, 0, 0, 1, 1, 0, 2, 1, 0, NA, 0, NA, 0, 0, NA, 0, NA, 134, 137, 156, 148, 151, 144, 143, 8, 128, 105, 103, 131, 120, 73, 1, 56, 26, 170, 139, 180, 160, 143, 145, 71, 63, 104, 105, 84, 47, 13, 1, 38, 30, 177, 167, 198, 188, 165, 182, 149, 159, 160, 89, 25, 110, 114, 147, 159, 163, 104, 113, 164, 145, 151, 85, 66, 48, 14, 125, 80, 165, 167, 173, 198, 169, 148, 166, 107, 49, 25, 93, 144, 121, 130, 96, 115, 154, 39, 97, 88, 111, 23, 59, 13, 11,
+#> 18, 97, 192, 163, 179, 150, 151, 78, 30, 2, 55, 110, 131, 101, 154, 180, 141, 134, 80, 13, 161, 25, 118, 30, 15, NA, NA, NA, NA, NA, 16, 13, 11, 7, 0, 5, 0, 7, 1, 10, 144, 142, 179, 164, 173, 86, 36, 3, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 1, 1, 0, 0, 0, 0, 2, 0, 12, 12, 2, 1, 0, 1, 3, 7, 8, 6, 11, 12, 10, 6, 10, 7, 0, 5, 117, 143, 154, 138, 171, 150, 141, 125, 132, 144, 103, 9, 72, 94, 134, 143, 126, 41, 81, 57, 0, 22, 97, 98, 91, 156, 170, 155, 114, 106, 16, 117, 64, 13, 165, 199, 223,
+#> 207, 234, 215, 164, 195, 210, 184, 139, 169, 9, 63, 163, 213, 186, 186, 147, 175, 152, 171, 39, 108, 102, 94, 117, 156, 159, 18, 18, 46, 109, 138, 134, 112, 132, 106, 2, 57, 39, 2, NA, NA, 0, 0, NA, NA, NA, NA, NA, NA, NA, NA, 0, 1, 1, 0, 0, 0, 0, 0, 0, 0, 0, 29, 144, 162, 187, 61, 132, 152, 90, 17, 59, 121, 121, 104, 91, 138, 120, 27, 56, 66, 13, 95, 152, 145, 152, 156, 82, 40, 110, 20, 12, 41, 106, 138, 61, 80, 97, 137, 169, 70, 57, 2, 5, 59, 72, 60, 121, 147, 119, 31, 69, 55, 3, 21, 10, 23, NA,
+#> NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 0, 0, 3, 13, 9, NA, NA, NA, 1, NA, 0, 1, 2, 2, 5, 1, 0, 0, 0, 1, 2, NA, 0, 1, 0, NA, NA, NA, NA, NA, 11, NA, NA, NA, 0, NA, NA, NA, NA, NA, 2, 1, 85, 134, 138, 167, 99, 162, 103, 187, 199, 172, 78, 149, 33, 102, 28, 61, 0, 5, 71, 102, 92, 60, 72, 97, 75, 25, 1, 39, 24, 39, 30, 115, 139, 129, 130, 118, 67, 61, 19, 88, 22, 119, 48, 148, 49, 77, 32, 142, 188, 137, 67, 201, 164, 10, 171, 123, 164, 190, 194, 119, 216, 195, 211, 155, 142, 225, 164,
+#> 141, 3, 10, 119, 46, 3, 39, 72, 144, 155, 122, 95, 141, 88, 41, 144, 120, 10, 161, 143, 113, 123, 97, 125, 28, 34, 87, 132, 104, 44, 152, 145, 72, 56, 18, 164, 122, 109, 93, 155, 97, 108, 92, 76, 127, 83, 9, 87, 66, 125, 133, 112, 48, 6, 11, 8, 133, 96, 67, 30, 57, 122, 86, 54, 23, 6, 2, 18, 191, 175, 157, 178, 153, 76, 49, 119, 161, 29, 32, 60, 42, 48, 6, 48, 27, 9, NA, 0, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 0, NA, 5, 6, 5, 10, 7, 5, 1, 7, 4, 13, 6, 2, 12, NA, 4, NA, NA, 0, NA, NA, NA, NA,
+#> NA, NA, NA, 6, 7, 11, 0, NA, 0, 0, 0, NA, 0, 0, 0, 0, 0, NA, 5, 111, 93, 124, 95, 125, 122, 111, 105, 113, 140, 111, 102, 96, 0, 10, 15, 17, 19, 11, 14, 0, 8, 15, 26, 9, NA, NA, 0, 10, 9, 0, 12, 3, 15, 99, 146, 169, 184, 162, 160, 113, 122, 48, 1, 12, 168, 118, 156, 96, 181, 159, 163, 109, 121, 151, 65, 157, 127, 42, 108, 81, 88, 110, 113, 165, 169, 113, 140, 130, 199, 100, 92, 10, 52, 3, 0, 84, 96, 143, 145, 134, 155, 135, 60, 42, 75, 46, 0, 2, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
+#> 0, 0, 12, 113, 55, 118, 30, 67, 133, 106, 111, 146, 106, 97, 63, 50, 146, 79, 153, 175, 84, 143, 66, 18, 2, 32, 8, 153, 188, 183, 183, 158, 186, 173, 172, 201, 25, 154, 138, 139, 82, 34, 0, 27, 96, 58, 99, 64, 45, 10, 10, 10, 11, 135, 192, 178, 181, 163, 42, 170, 88, 143, 87, 14, 87, 168, 184, 147, 148, 82, 79, 174, 133, 155, 190, 191, 169, 149, 45, 57, 76, 82, 3, 63, 46, 140, 160, 173, 175, 174, 109, 133, 117, 79, 103, 171, 167, 27, 56, 19, 61, 37, 0, 1, 3, NA, NA, 7, 18, 5, 2, 0, NA, NA, NA, 0,
+#> NA, 45, 107, 174, 111, 185, 140, 162, 121, 119, 158, 154, 71, 166, 171, 124, 40, 124, 68, 100, 4, 7, 0, 70, 46, 74, 88, 75, 101, 106, 120, 100, 101, 31, 15, 0, 2, 7, 1, NA, NA, 0, NA, NA, 0, NA, 0, NA, 0, NA, NA, NA, NA, NA, 117, 163, 162, 196, 177, 170, 154, 139, 128, 137, 124, 128, 169, 76, 77, 59, NA, NA, NA, NA, NA, 13, 8, 2, 2, 3, 2, 5, 9, 5, 3, 1, 1, 31, 146, 132, 161, 163, 159, 148, 140, 135, 92, 86, 46, 17, 93, 108, 132, 110, 16, 66, 56, 1, 1, 4, 6, 3, 1, 2, 5, 2, 0, NA, NA, 0, NA, 1, 0,
+#> 0, NA, 1, 10, 13, 8, 8, 18, 9, 4, 1, 4, NA, 0, 0, 0, 0, 3, 6, 4, 8, 7, 3, 5, 1, 1, 3, 91, 48, 82, 127, 158, 152, 95, 103, 110, 101, 28, 37, 9, 29, 3, 8, NA, NA, NA, 0, NA, NA, 0, NA, 0, NA, NA, NA, NA, NA, NA, 0, NA, 0, 0, 0, 0, NA, 0, NA, 0, 0, NA, 1, 0, 0, 0, 139, 103, 59, 7, 0, 21, 47, 16, 20, 11, 1, 73, 151, 148, 167, 147, 152, 79, 83, 135, 148, 182, 156, 160, 164, 157, 48, 109, 143, 74, 13, 20, 53, 43, 41, 74, 106, 99, 132, 125, 128, 84, 102, 121, 4, 101, 169, 156, 194, 170, 203, 28, 139, 147,
+#> 114, 56, 70, 35, 93, 22, 10, 16, 14, 100, 113, 48, 35, 75, 39, 5, 49, 14, 88, 94, 54, 147, 114, 164, 144, 146, 78, 56, 48, 33, 26, 114, 153, 161, 170, 175, 139, 167, 174, 191, 210, 188, 101, 180, 146, 166, 178, 156, 135, 130, 0, NA, 0, NA, NA, NA, NA, NA, NA, NA, NA, 0, 0, 0, 0, 0, 0, 3, 65, 145, 85, 143, 131, 143, 128, 23, 4, 92, 141, 86, 119, 28, 37, 9, 32, 46, 54, 52, 34, 1, 40, 108, 167, 142, 90, 21, 139, 116, 75, 27, 146, 40, 33, 1, 5, 3, 17, 10, 12, 7, 4, 9, 8, 13, NA, NA, NA, 0, NA, NA, 0,
+#> NA, 7, 13, 8, 18, 15, 14, 6, 14, 14, 10, 0, 0, 1, 3, 28, 80, 158, 158, 162, 108, 102, 18, 0, 4, 129, 40, 75, 58, 84, 61, 110, 146, 96, 42, 103, 54, 48, 31, 52, 35, 35, 10, 20, 3, 152, 159, 121, 174, 119, 60, 137, 48, 74, 211, 123, 102, 45, 110, 135, 123, 156, 52, 6, 120, 179, 179, 174, 180, 140, 67, 165, 185, 180, 173, 141, 104, 52, 41, 76, 148, 108, 146, 34, 88, 83, 18, 92, 144, 152, 144, 156, 149, 147, 181, 122, 149, 159, 155, 167, 93, 147, 156, 149, 133, 135, 12, 99, 94, 4, 5, 19, 17, 12, 18,
+#> 15, 15, 14, 11, 10, 7, 18, 11, 15, 12, 11, 10, 11, 13, 4, 5, 9, 1, 5, 2, 9, 7, 27, 140, 142, 122, 8, 105, 67, 97, 72, 21, 0, 0, 0, 0, 2, 1, NA, NA, 0, 0, 2, 1, 0, 1, 5, 1, 1, 0, 0, 0, 0, 0, 0, NA, 0, NA, NA, NA, NA, NA, NA, 0, NA, 12, 124, 109, 124, 158, 110, 104, 45, 163, 151, 123, 66, 84, 92, 106, 23, 13, 47, 40, 159, 163, 145, 153, 110, 120, 97, 52, 94, 92, 5, 46, 32, 59, 171, 158, 120, 170, 119, 95, 122, 157, 136, 190, 102, 112, 56, 33, 34, 80, 80, 11, 93, 127, 94, 122, 105, 102, 115, 91, 77,
+#> NA, NA, NA, NA, 2, 8, 10, 14, 14, 22, 10, 3, 0, 2, 2, 11, 10, 7, 17, 19, 14, 10, 14, 22, 14, 17, 9, 10, 8, 7, 8, 11, 13, 9, 12, 2, 145, 184, 168, 188, 177, 192, 120, 155, 193, 137, 166, 182, 189, 193, 157, 64, 69, 34, 11, 8, 123, 172, 167, 145, 113, 145, 168, 48, 155, 177, 109, 108, 115, 24, 71, 37, 9, 55, 12, 61, 121, 121, 85, 66, 47, 110, 11, 35, NA, 0, NA, 0, NA, NA, NA, NA, NA, NA, 0, 16, 160, 153, 174, 165, 147, 136, 159, 102, 141, 131, 96, 95, 74, 4, 17, 13, 12, 5, 11, 11, 0, 0, 2, 1, NA, 0,
+#> NA, NA, 0, NA, 0, 0, 0, 159, 178, 167, 139, 179, 197, 178, 160, 176, 113, 130, 63, 163, 160, 171, 147, 130, 179, 162, 164, 171, 183, 173, 166, 168, 152, 25, 63, 178, 185, 174, 141, 152, 184, 184, 155, 148, 191, 15, 132, 146, 65, 23, 126, 147, 49, 10, 9, 67, 128, 200, 155, 168, 158, 147, 174, 164, 153, 118, 141, 158, 143, 70, 31, 22, 146, 46, 174, 141, 141, 166, 113, 103, 115, 92, 134, 19, 87, 44, 21, 81, 6, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 2, 74, 109, 129, 108, 149, 192, 187, 186, 199, 126,
+#> 136, 128, 152, 176, 139, 164, 141, 89, 21, 82, 24, 106, 27, 144, 160, 182, 169, 185, 193, 120, 180, 181, 177, 184, 183, 143, 142, 75, 27, 46, 160, 134, 134, 133, 110, 107, 78, 7, 26, 8, 101, 141, 159, 130, 127, 151, 75, 208, 165, 166, 97, 174, 161, 129, 35, 42, 91, 2, 7, 12, 7, 12, 13, 6, 6, 17, 18, 10, 17, 0, 0, 0, 0, 10, 8, 5, 0, 0, 1, 168, 87, 16, 73, 76, 24, 1, 140, 153, 108, 164, 158, 167, 150, 176, 146, 103, 142, 96, 20, 16, 9, 41, 147, 167, 181, 32, 93, 182, 163, 179, 179, 169, 180, 144, 91,
+#> 146, 128, 9, 26, 144, 152, 166, 116, 104, 170, 158, 193, 183, 133, 173, 78, 96, 35, 0, 69, 144, 175, 182, 122, 156, 165, 163, 160, 82, 184, 88, 86, 19, 91, 143, 34, 184, 69, 76, 89, 69, 163, 111, 37, 95, 165, 163, 160, 151, 190, 166, 170, 45, 131, 94, 74, 1, 21, 31, 25, 30, 74, 123, 56, 131, 131, 77, 85, 2, 33, 71, NA, NA, NA, NA, NA, NA, 12, 5, 104, 88, 158, 180, 132, 61, 14, 102, 74, 15, 4, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 0, NA, NA, NA, 0, 0, 1, NA, 0, NA, 0, NA, 0,
+#> 0, 0, 42, 62, 99, 71, 116, 124, 73, 4, 33, 13, 26, 22, 47, 38, 6, 3, 3, 2, 2, 12, 10, 23, 15, 164, 185, 160, 149, 210, 164, 169, 140, 151, 135, 91, 48, 68, 94, 76, 123, 141, 49, 96, 85, 63, 98, 142, 143, 78, 144, 161, 158, 166, 191, 176, 156, 160, 61, 165, 154, 171, 126, 59, 47, 95, 42, 36, 149, 110, 126, 132, 122, 129, 115, 154, 27, 75, 48, 1, 29, 42, 2, 40, 85, 119, 79, 95, 18, 34, 76, 72, 41, 19, 74, 149, 180, 188, 137, 142, 207, 146, 147, 161, 145, 99, 95, 176, 157, 29, 5, 27, 46, 70, 148, 164,
+#> 167, 187, 117, 139, 132, 167, 138, 170, 151, 106, 8, 21, 3, 95, 116, 130, 200, 114, 143, 109, 154, 197, 173, 161, 173, 166, 145, 46, 64, 50, NA, NA, NA, 1, 10, 11, 3, 7, 11, 14, 10, 5, 8, 5, 11, 15, 3, 1, 0, 1, 1, 0, 0, 0, NA, NA, NA, NA, NA, 0, 0, 0, 0, 0, 14, 146, 107, 177, 166, 172, 139, 94, 165, 108, 138, 145, 47, 56, 16, 174, 129, 150, 184, 201, 5, 42, 137, 162, 156, 151, 134, 67, 121, 100, 113, 85, 81, 171, 205, 200, 139, 175, 113, 16, 131, 136, 13, 20, 52, 71, 20, 40, 10, 59, 57, 30, 47, 45,
+#> 43, 129, 87, 107, 107, 78, 25, 45, 82, 120, 41, 26, 49, 4, 130, 152, 172, 147, 173, 187, 174, 200, 181, 157, 60, 127, 123, 116, 43, 78, 192, 73, 104, 194, 86, 67, 35, NA, 2, 12, 18, 14, 9, 6, NA, NA, NA, NA, NA, NA, 0, 0, 1, 1, 0, 1, 8, 55, 74, 132, 116, 40, 78, 77, 18, 23, 157, 113, 65, 46, 19, 1, 1, 0, 0, 1, 1, 0, 0, 0, 0, 0, 0, 0, 0, 11, 88, 35, 61, 86, 32, 25, 133, 153, 188, 191, 162, 152, 105, 144, 65, 67, 49, 93, 4, 28, 30, 3, 1, 96, 138, 143, 94, 152, 157, 182, 161, 170, 133, 158, 176, 137,
+#> 104, 112, 17, NA, NA, NA, NA, 7, 9, 9, 3, 15, 17, 5, 3, 8, 0, 13, 0, 38, 118, 122, 147, 57, 160, 91, 58, 39, 98, 67, 4, 39, 121, 13, 6, 5, 23, 174, 144, 146, 175, 98, 79, 129, 116, 163, 123, 143, 20, 146, 102, 103, 28, 57, 8, 1, 1, NA, NA, NA, NA, 0, NA, NA, NA, NA, 2, 1, 12, 13, 8, 12, 7, 10, 0, 1, 1, 7, 2, 2, 101, 49, 157, 148, 149, 108, 156, 152, 70, 104, 90, 113, 101, 9, 0, 50, 15, 149, 131, 145, 149, 142, 115, 159, 178, 141, 114, 78, 63, 38, 43, 5, 79, 84, 104, 25, 75, 107, 84, 44, 117, 53,
+#> 82, 72, 9, 54, 119, 170, 177, 145, 103, 167, 195, 146, 154, 156, 151, 136, 145, 148, 111, 59, 90, 105, 17, 57, 83, 160, 122, 165, 207, 166, 205, 147, 167, 126, 15, NA, NA, 0, NA, NA, NA, NA, 0, NA, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, NA, NA, NA, NA, 0, 0, NA, 0, NA, NA, NA, 0, NA, 0, 142, 176, 93, 111, 121, 49, 123, 116, 7, 6, 10, 11, 1, 8, 12, 0, 1, 4, 9, 3, 0, 0, 9, 78, 149, 170, 184, 168, 174, 154, 162, 152, 185, 175, 162, 144, 143, 109, 74, 102, 18, 61, 1, 51, 130, 95, 155, 156, 176, 145,
+#> 114, 9, 12, 50, 1, 4, 86, 43, 163, 191, 186, 206, 169, 73, 120, 20, 126, 150, 158, 125, 4, 59, 12, 29, 89, 106, 111, 167, 147, 197, 198, 173, 219, 177, 33, 136, 112, 27, 20, 124, 64, 68, 156, 128, 151, 136, 161, 198, 180, 193, 189, 160, 144, 121, 84, 104, 25, 24, 41, 86, 142, 157, 142, 129, 137, 150, 153, 146, 154, 139, 40, 141, 119, 123, 86, 4, 78, 21, 50, 26, 15, 15, 79, 162, 131, 146, 184, 51, 155, 152, 148, 123, 150, 123, 90, 92, 64, 16, 6, 62, NA, NA, NA, NA, NA, NA, 1, 0, 3, 0, 1, 3, 0, 0,
+#> 0, 0, 0, 1, 3, 2, 7, 4, 13, 5, 4, NA, 4, 0, 2, 0, 8, 104, 136, 105, 148, 72, 79, 129, 136, 79, 116, 126, 129, 116, 80, 80, 23, 76, 73, 152, 118, 173, 168, 167, 169, 202, 165, 166, 204, 117, 147, 121, 118, 32, 52, 154, 162, 184, 163, 154, 163, 168, 192, 182, 171, 181, 131, 40, 114, 35, 97, NA, NA, NA, NA, NA, NA, 0, 0, 1, 8, 0, 0, 0, 0, 5, 13, 43, 56, 45, 99, 132, 153, 100, 123, 153, 131, 59, 59, 92, 10, 6, 6, 68, 105, 138, 122, 139, 78, 138, 117, 81, 150, 183, 110, 74, 12, 3, 1, 0, 1, 0, 1, NA, 0,
+#> 1, 0, 0, 0, 1, 1, 2, 0, 1, 3, 0, 0, 0, 0, 0, 0, 0, 0, 12, 183, 190, 203, 219, 201, 191, 191, 156, 188, 202, 214, 206, 179, 212, 179, 162, 216, 12, 149, 24, 139, 73, 47, 74, 54, 61, 43, 88, 34, 58, 47, 6, 68, 18, 37, 11, 33, 215, 176, 213, 143, 175, 201, 187, 181, 172, 194, 166, 183, 154, 127, 141, 103, 126, 38, 131, 34, 132, 62, 116, 184, 132, 42, 129, 128, 180, 168, 139, 105, 14, 99, 39, 26, 2, NA, NA, NA, 0, 1, 0, 0, 1, 1, 4, 5, 12, 0, 0, 1, 1, 1, 0, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 7, 5,
+#> 6, 6, 3, 4, 8, 1, 5, 0, 0, 0, 1, 0, 1, 0, 1, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 4, 7, 6, 8, 0, 0, 0, 0, 0, 0, 0, 6, 4, 1, 6, 1, 18, 61, 178, 154, 191, 203, 163, 176, 139, 172, 181, 156, 183, 183, 163, 164, 149, 146, 142, 98, 129, 77, 124, 134, 25, 114, 117, 37, 10, 1, 5, 16, 13, 4, 21, 24, 15, 14, 20, 20, 2, 12, 16, 4, 1, 5, 3, 9, 10, 0, 0, NA, NA, NA, 1, 2, NA, 0, 0, 0, 0, 0, 0, 0, 0, 21, 209, 195, 190, 197, 24, 197, 198, 50, 49, 65, 142, 122, 43, 45, 33, 159, 174, 113, 144, 160, 97, 57,
+#> 160, 157, 46, 154, 104, 107, 37, 108, 134, 61, 72, 15, 23, 118, 108, 86, 152, 174, 176, 149, 155, 147, 165, 134, 130, 120, 73, 40, 16, 123, 104, 91, 90, 182, 98, 91, 65, 160, 79, 48, NA, 0, 0, 8, 9, 2, 10, 11, 11, 6, 7, 0, 11, 12, 0, NA, NA, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, NA, NA, NA, NA, NA, NA, NA, NA, 4, NA, NA, NA, 1, 0, 1, 0, 0, 1, 6, 1, 0, 1, 4, 4, 16, 19, 53, 77, 102, 130, 97, 159, 117, 108, 123, 25, 68, 122, 137, 121, 99, 155, 153, 116, 206, 169, 183, 149, 9, 63, 23, 92,
+#> 158, 163, 199, 157, 148, 165, 149, 154, 148, 127, 33, 60, 64, 47, 46, NA, NA, NA, NA, NA, 5, 7, 5, 0, 0, 1, 0, 0, 1, 0, NA, NA, 0, 0, NA, NA, NA, 0, NA, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 29, 168, 129, 166, 143, 121, 38, 4, 61, 5, 7, 10, 9, 12, 10, 6, 2, 3, 0, 0, 0, 0, 0, 0, 0, 39, 72, 68, 77, 7, 23, 139, 161, 146, 120, 146, 68, 20, 53, 64, 44, 54, 85, 2, 50, 124, 127, 84, 40, 163, 52, 87, 159, 147, 134, 48, 0, 12, 30, 84, 132, 114, 152, 94, 88, 105, 29, 78, 156, 135, 117, 113, 41, 7, NA, NA,
+#> NA, 0, NA, NA, 0, NA, NA, 9, 9, 17, 5, 5, 3, 5, 10, 0, 1, 0, 1, 0, 0, 0, 0, 1, 3, 5, 8, 0, 3, 109, 118, 123, 175, 190, 164, 184, 166, 171, 157, 166, 118, 29, 130, 87, 34, 167, 132, 96, 111, 23, 54, 21, 12, 42, 112, 80, 153, 108, 28, 133, 159, 129, 103, 57, 18, 2, 82, 197, 151, 165, 111, 167, 185, 165, 45, 63, 134, 64, 2, 139, 185, 176, 188, 181, 180, 189, 179, 169, 117, 106, 133, 173, 160, 129, 84, 125, 111, 4, 40, 41, 50, 77, 4, 3, 25, 95, 39, 8, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0,
+#> 16, 194, 92, 189, 174, 160, 86, 74, 155, 140, 153, 172, 100, 56, 102, 54, 147, 164, 94, 132, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 28, 15, 132, 136, 155, 156, 196, 160, 140, 172, 123, 157, 139, 139, 162, 28, 93, 96, 163, 155, 191, 176, 111, 151, 133, 150, 102, 5, 6, 5, 98, 202, 193, 197, 184, 206, 130, 206, 165, 200, 186, 164, 113, 178, 163, 0, 0, 7, 10, 10, 16, 23, 20, 23, 22, 11, 11, 8, 5, 12, 0, 2, 14, 5, NA, NA, 0, NA, NA, NA, NA, NA, 1, 0, 1, 0, 0, 1, 2, 1, 0, 1, 1, 9, 4, 5, 2, 2, NA, NA, NA,
+#> 0, 11, 6, 10, 0, 0, 0, 1, 9, 1, 0, 2, 3, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, NA, NA, NA, NA, NA, NA, NA, 0, 15, 13, 12, NA, 4, 6, 0, 82, 62, 50, 179, 193, 100, 69, 123, 38, 141, 145, 170, 129, 172, 126, 59, 161, 159, 148, 240, 163, 177, 65, 146, 166, 21, 77, 89, 26, NA, 0, 0, NA, NA, NA, NA, NA, 0, 0, 3, 0, 2, 0, 2, 0, 0, 1, 1, 0, 0, 12, 41, 64, 78, 76, 35, 109, 83, 77, 111, 95, 107, 37, 7, 91, 177, 193, 187, 114, 48, 131, 84, 23, 74, 157, 60, 13, 11, 26, 167, 185, 216, 197, 182, 209, 190, 163, 165,
+#> 178, 79, 177, 102, 127, 57, 99, 45, 156, 152, 166, 181, 170, 178, 176, 134, 55, 113, 113, 60, 113, 7, 52, 43, 34, 20, 34, 8, 27, 46, 134, 121, 131, 27, 97, 145, 156, 148, 196, 181, 195, 150, 156, 160, 119, 149, 123, 0, 2, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 2, 0, 0, 0, 0, 0, 0, 0, 0, 0, 134, 89, 175, 194, 157, 175, 196, 157, 51, 165, 115, 27, 50, 126, 6, 36, 132, 160, 147, 142, 79, 52, 139, 136, 101, 147, 5, 99, 0, 1, 47, 96, 93, 145, 134, 137, 135, 122, 124, 129, 171,
+#> 45, 109, 95, 81, 22, 151, 188, 185, 181, 189, 192, 59, 92, 177, 216, 178, 144, 98, 84, 133, 171, 146, 161, 156, 128, 166, 194, 168, 172, 175, 164, 136, 115, 67, 75, 5, 75, 6, 166, 122, 146, 23, 70, 66, 89, 46, 79, 6, 14, 88, 139, 159, 161, 166, 131, 168, 117, 82, 22, 3, 26, 42, 78, 64, 17, 7, 1, 98, 83, 139, 145, 144, 130, 135, 114, 84, 148, 138, 108, 136, 42, 14, 34, 0, 4, 98, 94, 147, 162, 145, 141, 100, 155, 172, 153, 135, 161, 152, 167, 184, 157, 125, 242, 208, 212, 262, 206, 224, 238, 213, 225,
+#> 214, 184, 73, 105, 136, 102, 91, 10, 31, 74, 157, 89, 198, 41, 146, 191, 168, 65, 26, 41, 82, 96, 56, 27, 113, 111, 126, 139, 98, 115, 103, 100, 100, 101, 82, 47, 28, 14, 4, 73, 97, 100, 173, 148, 186, 67, 96, 139, 171, 192, 186, 70, 116, 130, 79, 28, 0, 0, 49, 84, 10, 28, 48, 126, 123, 71, 114, 148, 95, 62, 56, 115, 51, 28, NA, NA, NA, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 194, 185, 212, 196, 195, 177, 185, 187, 186, 183, 173, 173, 101, 172, 147, 4, 120, 94, 162, 107, 76, 54, 131, 142, 146,
+#> 206, 192, 198, 151, 176, 98, 157, 159, 129, 89, 9, 76, 28, 110, 157, 138, 206, 138, 140, 35, 63, 120, 132, 83, 115, 26, 0, 1, 0, 0, 0, 9, 7, 1, 0, 0, NA, 0, 0, 0, 0, 0, 0, 0, 0, 1, 26, 159, 129, 148, 121, 130, 125, 123, 61, 95, 153, 85, 89, 44, 0, 70, 107, 38, 97, 16, 2, 18, 11, 12, 43, 27, 0, 0, 0, 0, 0, 1, 0, 7, 6, 6, 6, 0, 4, 5, 0, 0, 26, 133, 85, 105, 115, 93, 121, 123, 137, 155, 130, 52, 42, NA, 0, NA, 0, 0, 1, 1, 0, 6, 0, 0, 0, 0, 20, 85, 149, 167, 166, 204, 177, 203, 199, 214, 152, 179, 199,
+#> 108, 63, 77, 45, 0, 0, 0, 0, 0, 0, 0, 158, 109, 140, 125, 23, 52, 38, 94, 19, 27, 72, 55, 26, 9, 4, 19, 12, 17, 6, 8, 2, 0, 0, 1, 9, 154, 209, 198, 170, 171, 179, 173, 127, 115, 128, 116, 147, 92, 56, 50, 5, 120, 173, 189, 183, 188, 185, 194, 195, 201, 133, 163, 152, 124, 163, 133, 28, 0, 0, 0, 0, 0, 0, 1, 0, 1, 10, 6, 7, 9, 12, 8, 9, 2, 0, 0, 2, 1, 7, 7, 9, 3, 2, 0, 1, 0, 0, 1, 0, 1, 7, NA, 0, 0, 0, 0, 1, 0, 0, 0, 2, 0, 0, 13, 9, 9, 0, 2, 4, 6, 0, 0, 0, 0, 0, 0, 0, 0, 14, 106, 45, 134, 158, 157,
+#> 146, 168, 199, 50, 180, 181, 163, 37, 105, 82, 34, 43, 63, 31, 147, 180, 141, 185, 187, 164, 132, 173, 106, 59, 73, 147, 58, 49, 49, 89, 84, 146, 158, 114, 135, 132, 43, 3, 47, 52, 60, 6, 0, 2, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 163, 134, 164, 111, 1, 52, 3, 4, 14, 15, 24, 11, 18, 0, 0, 1, 0, 12, 66, 114, 157, 120, 150, 62, 94, 2, 171, 113, 153, 27, 23, 0, 30, 167, 215, 146, 167, 185, 143, 128, 164, 161, 110, 56, 99, 42, 45, 150, 200, 155, 190, 158, 121, 85, 134, 172, 72, 4, 78, 137, 156, 165,
+#> 136, 175, 118, 163, 191, 115, 129, 52, 64, 49, 174, 118, 168, 144, 96, 7, 11, 8, 8, 14, 12, 4, 4, 5, 3, 5, 11, 19, 10, 0, 6, 1, 0, 16, 77, 0, 117, 71, 112, 129, 175, 180, 160, 182, 110, 129, 140, 162, 103, 160, 136, 144, 0, 0, 1, 1, 3, 1, 0, 2, 11, 7, 11, 3, 36, 102, 140, 193, 114, 17, 30, 47, 34, 109, 99, 109, 6, 38, 2, 27, 0, 130, 92, 82, 79, 132, 53, 2, 35, 23, 2, 116, 183, 163, 133, 54, 111, 142, 90, 109, 32, 42, 137, 153, 194, 177, 66, 85, 108, 69, 178, 154, 146, 113, 8, 95, 100, 5, 58, 56,
+#> 109, 130, 109, 187, 168, 171, 128, 146, 117, 90, 29, 9, 46, 147, 167, 181, 169, 74, 71, 107, 149, 178, 182, 188, 108, 13, 43, 120, 137, 170, 99, 111, 28, 58, 185, 208, 113, 181, 132, 73, 42, 42, 148, 148, 126, 151, 134, 200, 154, 166, 164, 148, 119, 189, 144, 194, 199, 178, 163, 68, 2, 11, 145, 93, 125, 123, 9, 5, 47, 155, 183, 182, 170, 176, 173, 173, 168, 69, 94, 171, 180, 165, 146, 127, 5, 48, 33, 87, 133, 143, 201, 151, 148, 141, 83, 71, 24, 48, 9, 43, 12, 1, 16, 31, 151, 156, 164, 173, 104,
+#> 156, 163, 177, 142, 105, 151, 171, 163, 159, 114, 43, 15, 89, 120, 121, 107, 83, 158, 72, 140, 126, 103, 126, 122, 55, 1, 0, 1, 6, 6, 5, 0, 4, 4, 7, 4, 9, 5, 9, 1, 1, 5, 5, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 1, 0, 1, 1, 5, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 2, 8, NA, 0, 0, 0, 1, 1, 5, 5, 9, 0, 0, 11, 8, 11, 1, 53, 127, 132, 125, 166, 152, 124, 156, 133, 98, 27, 26, 1, 56, 130, 111, 51, 124, 123, 137, 132, 87, 111, 93, 76, 26, 49, 9, 10, 7, 10, 13, 10, 8, 15, 6, 4, 4, 3, 0, 2, 0, 0, 0, 0, 0,
+#> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 11, 90, 182, 142, 153, 172, 152, 141, 57, 76, 127, 107, 2, 32, 112, 113, 149, 91, 52, 13, 15, 7, 127, 58, 118, 99, 47, 131, 117, 115, 54, 30, 19, 3, 84, 177, 198, 195, 188, 180, 198, 180, 197, 205, 193, 191, 145, 144, 172, 150, 130, 181, 180, 164, 111, 76, 190, 137, 183, 149, 161, 74, 71, 0, 1, 5, 1, 21, 27, 14, 10, 12, 11, 3, 0, 8, 0, 9, 5, 3, 46, 64, 42, 64, 169, 92, 77, 148, 60, 76, 104, 83, 4, 87, 8, 21, 69, 29, 124, 175, 176, 161, 180, 181, 179, 64,
+#> 36, 12, 66, 75, 53, 140, 130, 178, 179, 214, 165, 178, 166, 189, 197, 169, 144, 168, 155, 146, 152, 46, 0, 96, 150, 204, 216, 221, 217, 201, 183, 174, 186, 213, 169, 16, 129, 4, 22, 16, 147, 163, 155, 48, 105, 126, 163, 121, 10, 32, 29, 61, 102, 173, 61, 97, 142, 150, 116, 50, 136, 200, 178, 176, 165, 130, 78, 98, 166, 178, 114, 156, 185, 146, 134, 14, 72, 131, 118, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 5, 6, 6, 11, 6, 10, 0, 66, 201, 177, 51, 109, 159, 172, 146, 145, 151, 79, 155, 163, 137,
+#> 99, 30, 24, 76, 117, 190, 160, 187, 139, 102, 60, 135, 128, 20, 160, 52, NA, NA, 0, 6, NA, 1, 0, 2, 0, 0, 12, 4, 12, 12, 8, 7, 6, 1, 4, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 2, 0, 0, 185, 212, 177, 197, 163, 82, 68, 87, 105, 127, 100, 155, 165, 189, 162, 204, 200, 188, 196, 190, 187, 179, 5, 11, 57, 140, 117, 109, 154, 36, 83, 75, 33, 144, 181, 119, 176, 191, 167, 85, 174, 144, 126, 157, 32, 71, 158, 203, 176, 177, 161, 117, 103, 77, 135, 159, 25, 54, 50, 147,
+#> 136, 153, 137, 129, 126, 101, 91, 115, 108, 116, 147, 196, 216, 173, 99, 83, 186, 132, 177, 156, 156, 64, 0, 1, 18, 16, 24, 11, 20, 28, 15, 12, 14, 6, 84, 56, 190, 194, 191, 204, 41, 159, 181, 184, 113, 175, 50, 82, 77, 176, 181, 196, 189, 164, 166, 99, 178, 132, 144, 44, 22, 105, 191, 169, 155, 172, 137, 169, 156, 173, 126, 73, 27, 147, 21, 62, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 69, 27, 112, 116, 61, 9, 138, 121, 107, 95, 111, 98, 58, 0, 8, 7, 86, 166, 112, 166, 163, 57, 167, 106, 127, 43,
+#> 147, 42, 0, 1, 3, 1, 2, 2, 2, 1, 11, 1, 1, 0, 0, 0, 0, 0, 7, 4, 10, 10, 10, 17, 13, 0, 2, 1, 0, 0, 1, 0, 0, 0, 7, 54, 22, 159, 152, 168, 150, 111, 111, 34, 69, 23, 34, 185, 190, 174, 170, 108, 27, 60, 40, 41, 24, 45, 117, 158, 155, 126, 82, 99, 89, 99, 110, 106, 77, 169, 188, 143, 76, 90, 95, 18, 171, 132, 38, 12, 2, 84, 36, 78, 45, 151, 156, 106, 189, 149, 130, 76, 77, 17, 180, 156, 165, 190, 196, 191, 212, 154, 168, 85, 152, 158, 151, 131, 116, 17, 154, 165, 162, 177, 151, 170, 182, 174, 37, 187,
+#> 1, 46, 58, 73, 185, 206, 170, 160, 115, 118, 141, 56, 69, 36, 68, 12, 26, NA, NA, NA, NA, NA, NA, 0, NA, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 165, 213, 185, 87, 195, 163, 193, 153, 111, 146, 174, 203, 188, 187, 191, 67, 141, 144, 20, 15, 2, 14, 3, 4, 0, NA, 0, 0, NA, 0, 0, 2, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 6, 2, 4, 0, 3, 3, 5, 9, 17, 9, 10, 11, 15, 10, 13, 6, 1, 0, 0, 1, 0, 1, 0, 0, 0, 7, 0, 0, 15, 10, 11, 6, 2, 0,
+#> 0, 0, 0, 0, 0, 0, 0, 0, 0, 4, 11, 10, 7, 5, 4, 6, 3, 3, 10, 34, 173, 182, 172, 153, 176, 213, 145, 43, 171, 163, 157, 8, 77, 4, 0, 148, 187, 146, 161, 172, 183, 163, 158, 123, 173, 36, 97, 90, 97, 135, 141, 122, 145, 159, 161, 114, 132, 28, 63, 85, 165, 87, 43, 46, 61, 56, 8, 137, 24, 11, 5, 119, 128, 167, 181, 152, 145, 51, 101, 140, 33, 23, 18, 59, 10, 65, 181, 122, 60, 105, 174, 140, 173, 157, 160, 97, 112, 173, 171, 86, 141, 69, 48, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 4, 122, 164, 169, 118, 79, 165,
+#> 158, 163, 0, 5, 21, 141, 72, 90, 96, 35, 29, 40, 11, 9, 41, 35, 102, 142, 198, 178, 150, 56, 65, 154, 182, 109, 20, 165, 128, 15, 87, 190, 90, 186, 145, 160, 144, 89, 43, 42, 49, 138, 83, 110, 107, 74, 76, 23, 19, 36, 4, 11, 9, 81, 161, 129, 44, 79, 26, 90, 116, 31, 87, 67, 177, 185, 194, 183, 184, 121, 185, 184, 129, 33, 123, 103, 48, 99, 159, 177, 54, 195, 108, 39, 89, 184, 95, 122, 72, 0, 0, 0, 1, 0, 0, 2, 1, 0, 7, 0, 7, 19, 12, 15, 16, 16, 129, 131, 165, 159, 186, 186, 181, 147, 0, 0, 1, 1, 0,
+#> 0, 0, 0, 1, 1, 0, 1, 3, 0, 0, 1, 23, 176, 174, 121, 178, 161, 114, 163, 156, 60, 86, 1, 33, 107, 173, 142, 63, 130, 171, 138, 114, 30, 71, 39, 100, 176, 180, 150, 195, 122, 71, 155, 158, 0, 3, 18, 16, 16, 14, 8, 15, 13, 0, 110, 114, 155, 146, 142, 60, 24, 8, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 162, 96, 62, 13, 50, 109, 110, 22, 69, 92, 179, 135, 125, 82, 134, 93, 139, 122, 127, 160, 162, 151, 142, 158, 131, 85, 116, NA, 0, 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 0, 179, 174, 192, 52, 156, 99,
+#> 125, 132, 130, 14, 0, 1, 0, 0, 0, 1, 0, 0, 3, 5, 11, 1, 0, 0, 1, 1, 0, 9, 6, 20, 6, 4, 15, 8, 12, 6, 2, 7, 0, 0, 1, 1, 0, 0, 1, 1, 0, 0, 0, 0, 37, 72, 99, 160, 139, 72, 39, 36, 50, 73, 79, 197, 142, 157, 118, 62, 150, 3, 1, 0, 0, 0, 0, 9, 10, 12, 7, 10, 6, 9, 4, 6, 23, 177, 99, 161, 148, 162, 52, 139, 107, 97, 39, 3, 5, 8, 2, 4, 94, 135, 76, 12, 79, 148, 155, 80, 117, 158, 136, 27, 156, 151, 177, 185, 126, 177, 56, 171, 4, 4, 1, 53, 7, 58, 120, 151, 120, 21, 97, 127, 88, 51, 2, 2, 7, NA, NA, 0, 0,
+#> 0, 0, 1, 0, 0, 0, 2, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 2, 124, 46, 178, 153, 170, 177, 139, 150, 165, 165, 157, 181, 170, 145, 172, 155, 138, 137, 169, 140, 115, 80, 21, 0, 22, 10, 1, 10, 16, 15, 11, 12, 6, 2, 1, 29, 72, 38, 120, 127, 125, 152, 110, 166, 178, 10, 71, 99, 147, 121, 120, 109, 41, 155, 188, 15, 212, 82, 172, 156, 116, 2, 5, 3, 16, 12, 14, 11, 9, 102, 111, 131, 131, 123, 32, 69, 134, 128, 38, 52, 185, 189, 168, 150, 96, 143, 191, 182,
+#> 188, 187, 182, 125, 172, 177, 181, 10, 46, 96, 157, 135, 155, 150, 149, 164, 161, 132, 95, 130, 105, 161, 105, 33, 53, 106, 96, 122, 183, 189, 174, 192, 168, 149, 135, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 9, 0, 0, 0, 0, 0, 0, 17, 67, 137, 89, 75, 85, 34, 6, 44, 155, 185, 155, 157, 115, 153, 138, 49, 128, 150, 45, 91, 161, 105, 165, 150, 123, 93, 40, 134, 31, 89, 158, 135, 171, 155, 147, 153, 136, 0, 4, 0, 18, 2, 0, 0, 40, 186, 167, 112, 170, 46, 81, 153, 71, 16, 73, 47, 4, 129, 149, 103, 133,
+#> 117, 201, 159, 96, 171, 172, 50, 189, 151, 134, 112, 146, 164, 115, 0, 1, 0, 0, 0, 1, 0, 13, 8, 11, 2, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 1, 0, 0, 0, 0, 0, 0, 0, 10, 12, 71, 148, 87, 96, 143, 92, 31, 164, 161, 95, 91, 142, 158, 158, 142, 90, 90, 117, 140, 153, 133, 69, 5, 80, 146, 26, 155, 121, 128, 89, 19, 146, 139, 104, 47, 10, 0, 7, 4, 89, 142, 161, 110, 173, 130, 50, 64, 150, 124, 163, 148, 194, 185, 172, 165, 144, 90, 158, 97, 155, 160, 8, 16, 124, 94, 97, 88, 138, 162, 174,
+#> 118, 102, 88, 145, 1, 27, 182, 190, 173, 172, 144, 116, 96, 172, 3, 6, 27, 110, 132, 152, 128, 118, 150, 124, 150, 151, 128, 133, 133, 137, 65, 20, 122, 5, 7, 139, 138, 89, 111, 99, 120, 135, 81, 17, 47, 0, 0, 105, 77, 143, 150, 141, 164, 107, 131, 1, 0, 13, 7, 6, 5, 23, 141, 148, 150, 168, 151, 136, 0, 0, 0, 0, 0, 0, 0, 0, 0, 12, 0, 0, 0, 1, 0, 15, 153, 124, 188, 136, 178, 50, 189, 91, 181, 49, 87, 145, 150, 138, 39, 147, 182, 122, 182, 130, 124, 177, 29, 149, 72, 72, 52, 108, 152, 163, 36, 75,
+#> 48, 150, 132, 142, 3, 1, 8, 98, 72, 57, 11, 2, 3, 84, 93, 23, 34, 19, 139, 167, 88, 150, 1, 87, 199, 162, 156, 89, 45, 128, 130, 92, 106, 4, 29, 25, 89, 111, 158, 151, 62, 162, 165, 150, 93, 162, 63, 98, 45, 6, 59, 100, 142, 169, 18, 96, 141, 150, 163, 0, 0, 7, 6, 3, 6, 0, 3, 4, 0, 2, 4, 107, 174, 122, 8, 61, 177, 20, 27, 0, 0, 0, 1, 0, 47, 154, 160, 158, 166, 2, 0, 0, 1, 15, 68, 113, 132, 170, 95, 117, 114, 69, 165, 143, 93, 135, 130, 106, 155, 74, 0, 7, 7, 11, 6, 17, 19, 176, 178, 10, 11, 61, 167,
+#> 177, 225, 200, 20, 86, 135, 84, 35, 73, 120, 159, 158, 200, 164, 7, 126, 163, 132, 120, 139, 146, 93, 176, 82, 2, 38, 119, 139, 177, 142, 165, 157, 6, 5, 7, 0, 1, 0, 0, 2, 7, 12, 0, 87, 133, 142, 127, 54, 102, 118, 66, 4, 55, 134, 161, 68, 69, 22, 176, 205, 20, 119, 80, 192, 43, 143, 144, 166, 40, 108, 124, 121, 130, 5, 66, 174, 155, 184, 41, 135, 125, 166, 188, 172, 140, 108, 154, 46, 35, 13, 173, 56, 132, 167, 36, 44, 165, 57, 95, 74, 139, 168, 11, 129, 196) x c(0.39424925136778, 1.02437412321201, 0.0235875620476448, 0.616646264959861, 0.542513927095834, 0.764910940687915, 1.17263879894006, -1.53319153309692, -1.34786068843685, -0.272941789408463, -1.38492685736887, -2.09772657770811, -1.23395681041654, -0.616978405208269, -0.308489202604134, -0.462733803906201, -0.586129484947855, -0.524431644427028, 0.185093521562481, 0.185093521562481, 0.0308489202604134, 0.154244601302067, 0.555280564687442, 1.07971220911447, 0.586129484947855, 1.29565465093736, 1.35735249145819,
+#> 1.66584169406233, 1.29565465093736, -0.308489202604134, -1.48074817249984, -0.771223006510336, -0.032646807124959, 0.261174456999676, -0.032646807124959, -0.816170178123986, 0.554995721124311, 1.24057867074846, -2.18733607737228, 0.261174456999676, 0.750876563874068, -1.79031913733854, 0.65018474695083, 1.05693539433239, 1.27879938381324, 1.20484472065296, 0.428320757469978, 0.428320757469978, -0.126339216232152, -1.12472716889598, -0.717976521514423, -0.348203205713003, -0.939840510995275, -2.03249340652169,
+#> -0.675853390032699, -1.31717412510022, 0.804117537046203, 0.458790987394459, 0.60678808010235, 0.705452808574276, 0.779451354928221, 0.582121897984368, 0.088798255624734, -1.44810203650022, 0.238044170383598, 0.585191918859678, 1.42826502230159, 1.03152473832892, 0.287636705880181, 1.13070980932209, 0.733969525349426, 0.486006847866512, 0.287636705880181, -0.555436397561728, -1.64647217848655, -1.4976945719968, -0.109103578092482, -0.952176681534392, -1.73691090851898, -0.935259719971759, 1.33608531424537,
+#> 0.57897030283966, 0.935259719971759, 0.57897030283966, 1.38062149138688, 0.133608531424537, 0.57897030283966, -1.15794060567932, -0.57897030283966, -0.222680885707562, -0.890723542830247, -0.762449411850651, 1.18009686038031, 0.645896635516793, 1.03440588996299, 0.35451469468215, 0.35451469468215, 0.208823724264828, -0.422503814210234, -0.37394015740446, -2.21935911602387, -0.607271243017355, 0.658832008933923, 0.697789032070886, 0.483525404817592, 0.873095636187217, 0.561439451091517, 0.44456838168063,
+#> 0.541960939523036, 0.561439451091517, 0.619874985796961, 0.970488194029623, 0.873095636187217, -0.918927428113055, -0.451443150469506, -1.63963235614686, -1.6980678908523, -1.97076705281104, -1.69592511345908, 1.11667175402334, 0.968640339945317, 0.968640339945317, 0.894624632906306, 0.524546097711251, 0.968640339945317, 0.598561804750262, 0.524546097711251, 0.302498976594219, 0.0804518554771859, 0.37651468363323, 0.37651468363323, 0.0804518554771859, 0.228483269555208, -0.141595265639847, 0.00643614843817502,
+#> 0.450530390672241, -0.289626679717869, -0.36364238675688, -1.39986228530303, -2.14001935569314, -2.43608218384919, -1.86460455938005, 0.360965370928074, 0.866776718725375, -0.903562998565179, -0.271298813818553, 0.462127640487534, -0.675947892056393, -2.82564612019492, 0.310384236148344, 0.68974274699632, -1.20704980724356, 0.9932295556747, 0.613871044826724, 1.11968239262403, 0.386255938317939, 1.17026352740376, -0.574785622496933, 0.108059697029423, 0.613871044826724, 0.209221966588883, 0.411546505707804,
+#> 0.00689742746996303, -1.66177355300354, -1.17455198772501, 0.0435019254712968, 0.0435019254712968, -1.66177355300354, 0.287112708110559, 0.591626186409636, 1.01794505602834, 1.01794505602834, 0.835236969048898, 0.896139664708713, 0.835236969048898, 0.104404621131112, -1.17455198772501, -2.01301641059915, 0.411583280977522, 0.411583280977522, 0.613633255275579, 0.815683229573635, 0.546283263842893, 0.142183315246781, 0.344233289544837, 1.35448316103512, 0.0748333238140952, 0.142183315246781, 0.613633255275579,
+#> 0.478933272410208, 0.276883298112152, 0.344233289544837, -0.598666590512759, -2.34976636776258, -1.60891646200304, 0.452208795633309, 1.14019960922328, 0.362470863425921, -0.205869373887537, 0.153082354942015, 0.512034083771568, 0.601772015978956, 0.541946727840697, -0.325519950164055, -2.21001652651921, -1.13316134003055, -1.64167628920575, 0.960723744808509, 0.870985812601121, 1.17011225329241, -1.16307398409968, -0.0862187976110198, -1.56225467410311, 0.856373548418907, 0.695131666917439, -0.361898445147739,
+#> -0.953118677319787, 0.78471048997381, 0.963868136086552, 0.945952371475278, -1.36518126337909, -0.00358315292225489, -1.71185581176174, -0.677755158126078, 0.579934826025407, 0.384294161824065, 0.468140160767497, 0.356345495509587, 0.55198615971093, 0.915318821799137, 0.971216154428092, 1.27865148388734, -1.57211248018936, 0.32839682919511, 0.579934826025407, 0.300448162880633, -1.01313915389981, -1.73980447807622, -1.16278981459808, 0.00731314348803825, 0.615766681692821, 0.100921380134928, -0.928769222980858,
+#> 0.849787273310045, 0.615766681692821, 1.08380786492727, 0.943395509956934, 1.52844698899999, 0.592364622531098, -0.624542453878467, 0.405148149237319, -0.718150690525356, -1.65423305699425, -1.65423305699425, -2.90117387302829, -0.899845423273297, -0.0421332305211581, 0.215180427304484, 0.12940920802927, 0.501084491555197, 0.615446117255482, 0.35813245942984, 0.329542053004769, 0.558265304405339, 0.672626930105624, 0.615446117255482, 0.386722865854911, 0.472494085130125, 0.586855710830411, 0.701217336530696,
+#> 0.672626930105624, -0.928435829698368, -2.04346168027615, -2.03107915237279, 0.574053508934107, 0.557026498075892, 0.574053508934107, 0.454864432926602, -0.651891272857376, 0.522972476359462, -0.617211737810908, -0.158030058473324, 0.384639198925639, 1.01079603438598, 1.38649013566219, -0.032798691381256, 0.802077089232533, 1.26125876857012, 1.21951497953943, -0.658955526841598, -0.951162050056424, -1.15988099520987, -1.28511236230194, -1.20162478424056, 0.0128205128205132, 0.128205128205129, -0.564102564102564,
+#> 0.243589743589744, 0.358974358974359, 1.05128205128205, 1.05128205128205, 0.0128205128205132, -2.29487179487179, 0.797738664920081, -1.21138093561938, -1.21138093561938, 1.21138093561938, 1.32956444153347, 0.856830417877124, 1.21138093561938, 1.0931974297053, 0.147729382392608, 0.679555159005995, 0.265912888306694, -0.206821135349651, 0.0295458764785215, -0.0886376294355645, -1.15228918266234, -0.915922170834167, -1.44774794744755, -1.38865619449051, -3.0054468665374, -1.00083871762313, 0.827926611210938,
+#> 0.827926611210938, 1.03893799530718, 0.47624097105054, 0.687252355146779, 0.47624097105054, -0.156793181238177, -1.00083871762313, 1.03893799530718, 0.652083791130739, 0.898263739243018, -0.543647385414616, -0.0864560532060978, -0.508478821398576, 0.0542182028580616, 0.37073527900242, 0.652083791130739, 1.00376943129114, -0.191961745254217, -1.66904143392789, 0.265229586954301, -1.10634440967125, -1.62812653421456, -1.16457758667209, -0.897145501551432, 0.61830298079896, 1.04619431699201, 0.99270789996788,
+#> 0.546987758100118, 0.689618203497802, 0.671789397823091, 0.707447009172512, 0.778762231871354, 1.08185192834143, 0.778762231871354, 0.921392677269038, 0.743104620521933, 0.368699701353013, 0.760933426196644, 0.529158952425407, 0.0834388105576452, -0.718857444804327, -1.23589280937093, -1.53898250584101, -1.44983847746746, -1.55681131151572, -1.12891997532267, -0.0476386181302833, 0.795198471867029, 0.611973017519787, 0.428747563172545, 0.941778835344823, 0.428747563172545, 0.575327926650339, -1.33021679856098,
+#> -0.267509163346973, -2.13640879768884, -2.00672533351185, -2.1147105532524, 0.15297906129911, -0.413943342338768, -0.791891611430686, 0.88187929454781, 0.773894074807262, 0.638912550131577, 1.17883864883432, 0.800890379742399, 1.61077952779651, -0.224969207792809, 0.206971671169384, 0.0179975366234248, -0.872880526236097, -0.30595812259822, 0.557923635326166, -0.0899876831171233, -2.14400181359907, -0.457387053567802, 0.686080580351704, 1.20064101561548, 0.943360797983593, 0.600320507807741, 0.48597374441579,
+#> 0.400213671871827, 1.02912087052756, 0.0285866908479877, -0.428800362719815, -1.80096152342322, -0.257280217631889, -0.285866908479877, -0.195177548361805, 0.0671410766364609, 1.00711614954691, -0.894693881690515, 1.11641557662953, -0.326336860860938, -0.719814798358337, 1.64105282662606, -0.829114225440948, 1.75035225370867, -0.413776402527027, -1.375611360854, 0.0452811912199388, -0.872833996273993, -0.655799659591127, 0.521100179285303, 0.50045281369098, 0.43851071690801, 0.8721053943888, 0.851458028794477,
+#> -0.0157313261671034, 0.459158082502333, 0.12880023299316, -0.0570260573557501, -0.717741756374097, 0.706926469634214, 0.232037060964777, 0.851458028794477, 0.913400125577447, 0.93404749117177, 0.335273888936393, 0.0668581362101899, -2.01852578881647, -2.16305734797673, -2.18370471357105, -0.513676237543478, -0.139640142244829, -0.139640142244829, 0.23439595305382, 0.23439595305382, 0.982468143651119, 1.28169701989004, 0.982468143651119, 1.50611867706923, -1.26174842814078, 0.45881761023301, -1.78539896155889,
+#> -0.513676237543478, 0.23439595305382, -1.5609773043797, 0.249121577722118, 0.615476839078174, 0.322392629993329, 0.542205786806963, 1.05510315270544, 0.835289995891808, 0.542205786806963, -1.28957051997332, -1.06975736315968, -1.8024678858718, -2.97703447654319, 0.746721420655108, 0.581221158557406, 0.0847203722642995, 0.291595699886427, 0.126095437788725, -0.163530020882254, -0.0394048243089772, 0.581221158557406, 0.374345830935278, 0.374345830935278, 0.746721420655108, 0.167470503313151, 0.705346355130683,
+#> -0.122154955357828, 0.498471027508555, -0.784156003748637, 0.705346355130683, 0.953596748277236, -0.411780414028807, -2.43915862472566, -2.49762108016271, -1.88908017854652, -0.810303125681453, 0.40677867755093, -0.00813557355101867, 0.904675778873269, -0.146440323918335, -0.0634574736979452, 0.462100577697857, 0.130169176816298, 0.821692928652879, 0.877014828799806, 0.711049128359026, 0.904675778873269, 1.07064147931405, -0.450710774726431, -0.423049824652967, -1.26781484956282, 0.562162863527082,
+#> 1.08501363869563, 0.0953318142694528, 1.12236012263624, 1.06634039672532, 0.599509347467692, 0.618182589437998, 0.580836105497387, -0.894350010156721, 0.91695446096288, 0.786241767170744, 0.84226149308166, -0.20344005725543, -0.427518960899092, -1.30516133350343, -0.70761759045367, -1.73464589882045, -1.73464589882045, 0.0262658155512955, 0.0262658155512955, -1.5102843941995, -0.485917587698968, 1.90427162746893, -0.315189786615547, 1.90427162746893, 0.367721417718138, 0.0262658155512955, -0.315189786615547,
+#> 0.0262658155512955, -0.315189786615547, -1.33955659311608, 0.516782516407555, 0.435490884613108, -0.13355053794802, 1.41099046614647, 0.516782516407555, -0.377425433331361, 0.354199252818661, 0.841949043585343, -1.10905011948138, -1.51550827845362, 1.24840720255758, 0.354199252818661, -0.621300328714701, -1.92196643742585, -1.95651492453194, 0.380359313432198, 0.90218559957953, -0.209531270908264, -0.0960907739197132, 0.76605700319327, 1.01562609656808, 1.08369039476121, 0.743368903795559, 0.584552208011589,
+#> 0.697992705000139, 1.01562609656808, -0.776733755851015, -1.16243144561209, -0.958238551032696, -1.72963393055484, -0.300283668499104, -1.96267486642005, -1.81598765667266, -0.202428349451395, 0.732702612688202, 0.732702612688202, 0.347648687101309, 0.732702612688202, 0.641023106596084, 0.714366711469778, 0.769374415125048, 0.769374415125048, 0.787710316343472, -0.294107855543512, 0.494335896848696, 0.732702612688202, 0.475999995630273, 0.751038513906625, 0.586015402940814, 0.714366711469778, 0.0909460700433803,
+#> -0.129084744577701, -0.330779657980359, -1.41259782986734, -1.90766716276478, -2.01768257007532, -1.26799503429074, -0.519915368042514, 0.864032014516695, 1.61211168076492, 0.041144381643652, 0.602204131329818, 0.602204131329818, 0.415184214767763, -0.931359184479036, -1.41761096754038, -0.740918041918376, -0.891358253475406, -0.910163279920035, -0.402427565915057, 1.51568513143708, 1.62851529010486, 0.725874020762672, 0.406188571203983, -0.402427565915057, -0.928968306364664, -3.00183828849416,
+#> -2.40033141322854, 0.40670067134437, 0.356575098405568, 0.356575098405568, 0.65732853603838, 0.356575098405568, 0.782642468385385, 0.582140176630177, 0.607202963099578, 0.381637884874969, 0.00569608783395492, 0.181135593119762, 0.582140176630177, 0.13101002018096, 0.105947233711559, 0.582140176630177, 0.206198379589163, -0.244931776860055, 0.582140176630177, 0.356575098405568, -1.57325945973831, -0.618541850819364, -0.161358743692008, 1.21019057769006, 1.36258494673251, 0.600613101520251, -1.68530243411653,
+#> 0.905401839605154, -0.161358743692008, -0.31375311273446, 0.143429994392895, 0.448218732477799, -0.0089643746495565, 0.600613101520251, -0.466147481776912, 0.753007470562702, -0.0089643746495565, -2.59966864837124, -2.35846994086601, -0.653285100991054, -0.343251493741063, 0.0442905153214272, -0.188234690116067, 0.819374533446407, 0.741866131633909, 0.819374533446407, 1.51695014975889, 1.0518997388839, 0.974391337071403, 1.59445855157139, 0.896882935258905, -0.885810306428548, -0.498268297366058,
+#> -0.110726288303569, -0.188234690116067, -0.42075989555356, -0.653285100991054, -0.730793502803552, -1.42836911911603, -0.0518922892907439, 0.281700999006896, 0.670893168687477, 0.337299880389837, 0.504096524538657, 1.61607415219746, 0.782090931453357, 0.670893168687477, 0.504096524538657, -0.0518922892907439, -0.163090052056624, -1.60866096801307, -1.66425984939601, 0.114904354858076, -1.94225425631071, -1.09908736209609, -0.646521977703585, -0.369954242797051, -0.143671550600797, -0.168814071955936,
+#> -0.646521977703585, -0.721949541769003, -0.520809370927888, -0.998517276675536, 1.74201755103466, 0.560319047343107, 0.283751312436573, 0.40946391921227, 2.32029554220287, -1.75355243617738, 0.789426159001396, 0.510997845660655, 0.65949294610905, 0.548121620772754, 0.715178608777199, 0.789426159001396, 0.752302383889298, 0.566683508328803, 0.603807283440902, 0.251131419875963, 0.269693307432012, 0.492435958104606, -0.194353881469223, -1.69786677350923, -1.36375279750034, -1.93917131173787, -0.872489907422751,
+#> -0.121136560081542, 0.565815071773278, 1.20983222663717, 1.36010289610541, 1.20983222663717, 0.286740971332258, 0.179404778854942, -0.829555430431825, 0.329675448323184, 0.71608574124152, -1.15156400786377, -1.10862953087285, -1.7741139242322, -1.8246629144887, -1.60002838721903, -0.0275866963313626, 0.646316885477639, 1.09558594001697, 0.197047830938305, 1.32022046728664, 1.09558594001697, 1.09558594001697, -0.701490278140365, -1.67490656297559, 0.646316885477639, 0.721195061234195, -0.0275866963313626,
+#> 0.122169655181749, 0.0472914794251931, -1.22563750843626, 0.571438709721084, -0.476855750870697, -0.500882176672369, -0.258226821652335, -0.434703443485087, -0.147928933006866, -0.0155714666323016, 1.0874074198224, 1.0653478420933, 0.93299037571874, 1.33006277484243, 0.778573331615082, 1.17564573073877, 0.38150093249139, 0.27120304384592, -0.986192886712437, -1.62592064085616, -1.40532486356522, -1.64798021858526, -2.28477143537759, -0.0392422574778594, -1.23831123596801, -0.21365229071279, 0.592994112998765,
+#> 0.418584079763834, 0.832807908696795, 0.505789096381299, 0.549391604690032, 0.898211671159894, 0.963615433622993, 0.941814179468626, 0.592994112998765, 0.00436025083087333, -0.562472357182652, -1.73974008151843, 0.505789096381299, 0.985416687777359, -0.017441003323493, -1.6961375732097, -1.08617622981541, -1.59235544370997, 0.24254420665781, 0.685451018815551, 0.875268224026011, 0.685451018815551, 0.811995822289191, 0.875268224026011, -1.14944863155223, 0.558906215341911, 0.558906215341911, -1.46581064023633,
+#> -1.20407631115449, -1.13683295695389, 0.191223288507955, -0.178615159595343, 0.998143538915152, 0.762791799213053, 1.317549471368, 1.03176521601545, 1.1494410858665, -0.649318638999541, -0.96872457145239, -0.78380534740074, 1.2166844400671, 0.577872575161404, -1.17045463405419, -1.15364379550404, -0.12840126725248, 0.922154555722354, -0.245129692027461, 1.03888298049734, 0.338512431847446, 1.5933429981785, -0.0116728424774981, -0.770407603514878, -1.35404972738979, -1.38323183358353, -1.18858480741849,
+#> -0.136887576135276, 0.193645839410878, 0.343888301022766, 1.15519759372696, 1.3655370399836, 0.464082270312276, -0.557566468648562, -1.63931219225415, -0.405910255700239, -0.405910255700239, 2.06883291614961, 0.189861248633983, 0.60231844394229, 0.877289907481162, 1.06060421650708, -1.41413895534277, -1.27665322357333, -0.176767369417846, -0.268424523930803, -0.0392816376484101, 0.60231844394229, -1.41413895534277, 0.945461732179839, -0.0574590002982223, 0.527578093647314, 1.02903845988634, 1.11261518759285,
+#> -0.976803005069779, 0.694731549060324, 0.360424638234303, 0.0261177274082829, -0.391765911124243, 1.36334537071237, -0.308189183417738, -0.475342638830748, -0.308189183417738, -0.976803005069779, -2.56476083149338, -1.16044143483786, -0.92184599963755, 0.422964635127817, 0.813393529091956, 1.20382242305609, 1.29058439949257, 1.0953699525105, 0.401274141018698, 0.791703034982837, 0.357893152800461, -1.26889390538345, -1.11706044661962, -1.11706044661962, -0.791703034982837, -0.785597971055937, 0.912092559615791,
+#> 0.883797717437929, 0.487669926947859, 0.572554453481446, 0.572554453481446, 0.883797717437929, -0.0499320744315215, 0.261311189524962, 0.431080242592135, 0.657438980015032, 0.940387401793654, -0.0216372322536593, -1.43637934114677, -2.20034007994904, -0.219701127498694, -1.88909681599256, -1.26170990867754, 1.10784284664369, 0.964233588745435, -0.759077506033641, -0.471858990237128, 1.03603821769456, -0.615468248135384, -2.62175237072047, 0.62756623963062, 0.580813453870172, 0.62756623963062, 0.650942632510843,
+#> 0.650942632510843, 0.674319025391067, -0.494500618620116, 0.580813453870172, 0.113285596265699, 0.463931489469054, -0.634758975901458, -1.21916879790705, -1.84671673640481, -0.0307217201989711, 0.232119663725558, 1.49853724081647, 1.02064381549915, 0.0409622935986278, 1.04453848676501, 0.518855718915954, 0.375487691320756, 0.494961047650087, -0.580299159313896, -0.962613899567756, -0.0068270489331048, -1.79892739387308, 0.70650700059107, 0.991218776948666, 1.65554625511639, -1.38137935936463, -0.906859732101971,
+#> -0.811955806649439, -0.527244030291844, 0.326891298780943, -0.0527244030291845, -1.43899578769525, -1.43899578769525, -1.19954323982203, 0.827821665504556, 0.939566187845391, 0.843785168696104, 0.428734085715858, -0.80045566003333, -0.19384253875451, 0.955529691036939, 0.811858162313008, -1.24743374939667, 0.700113639972172, 0.811858162313008, 0.343304394913062, -0.478059391047161, 0.70265105127066, 0.830989142826945, 0.830989142826945, 0.522977723091861, 1.34434150905209, 1.54968245554214, 0.574312959714375,
+#> -0.170047971312078, -0.298386062868363, -0.65773271922596, -0.709067955848474, -1.81277554323253, -0.888741284027273, -1.68443745167624, -0.241348751893136, 0.729292967677084, 0.88669432760739, 0.7030594076887, 0.545658047758394, 0.912927887595774, 0.283322447874551, -0.503684351776979, -1.36939183139366, -1.94653015113812, 1.12232516465208, 0.850638381278088, 0.918560077121586, 0.986481772965083, 1.05440346880858, 1.05440346880858, 0.918560077121586, -2.06999453999231, -0.236108752217872, 0.850638381278088,
+#> -0.168187056374375, -0.0323436646873797, 0.375186510373606, -0.84740401480935, -0.100265360530877, -1.79830775661832, -0.711560623122355, 0.23934311868661, 0.0355780311561179, -0.779482318965853, -1.66246436493132, 0.635035610086572, 0.96125253307625, 0.700278994684508, 0.308818687096894, -0.539345312676268, 1.02649591767419, -0.474101928078333, -0.604588697274204, -1.71372623543911, 0.37406207169483, 0.504548840890701, 0.113088533303087, 1.4179562252618, -0.604588697274204, -2.10518654302672, -1.2250530953398,
+#> -0.345227000875511, 0.7357022008949, 0.836253754547962, 0.635150647241839, 0.635150647241839, 0.358633874695919, 0.68542642406837, 0.811115866134696, -2.73332640013572, -0.118986005156123, 0.434047539935716, -1.07422576486021, -0.118986005156123, 0.484323316762246, -1.72575057059853, -1.55137641510902, -0.292007514351475, 1.04486101106808, 1.18048535422658, 0.541113450765056, -0.020758828034465, 1.02548610490257, -0.563256200668486, 1.08361082339908, 0.792987230916566, 0.231114952117045, -0.892629605481998,
+#> -0.853879793150997, -1.90274667520222, 0.0552054161083816, -1.06362435035482, 1.17403518257158, 1.03418146176368, 0.964254601359731, 0.754474020147881, -1.55311237318247, -0.0846483046995183, 0.544693438936031, 0.614620299339981, 0.404839718128131, -1.41325865237457, -0.0147214442955683, 0.754474020147881, 0.754474020147881, 0.684547159743931, -1.55311237318247, -0.154575165103468, -1.81798504756012, -1.44656874752096, 0.273675168449911, 0.801477279031881, 0.703736147442627, 0.723284373760478, 0.136837584224955,
+#> 0.547350336899821, 0.742832600078329, 0.0977411315892538, 0.156385810542806, 0.703736147442627, 0.78192905271403, 0.586446789535523, 0.821025505349732, 0.664639694806926, -1.03605599484609, -1.2706347106603, -2.16985312128143, -2.17178927751729, -1.85623015172418, -0.00232028768965536, 0.49074084636208, 0.589353073172427, 0.352683728827594, 0.82602241751726, 0.273793947379316, 0.687965299982774, 0.648520409258635, 0.273793947379316, 0.510463291724149, 0.806299972155191, 0.786577526793121, 0.471018401000011,
+#> -1.20538945477589, -1.48150368984486, -0.831093988138168, -0.0659088075699515, -0.0659088075699515, 0.562636162182512, -0.0385807654068009, -0.44850139785406, -0.339189229201458, 1.68308589087169, 0.89057266814032, 1.38247742707703, 0.152715529735253, -0.776437903811867, -0.995062241117072, 1.51911763789278, -1.67826329519584, 0.507980077856211, -1.45963895789063, -1.11252487984698, -1.24962679058551, 0.498422571330676, 1.21820760270793, 0.721213176280778, 1.02969247544246, -0.0328473327811048, 1.06396795312709,
+#> 0.481284832488361, 0.0357036225881572, -1.30104000711245, -1.3524532236394, -2.12177001401378, -1.24305717992726, -0.835848793399367, -0.107160101717868, 0.835848793399367, 0.878712834086514, 0.492936467902191, 0.900144854430088, 0.750120712025073, 0.0642960610307206, -1.37164930198871, 0.985872935804382, 0.36434434584075, 0.407208386527897, -2.35021546446414, 0.0859834926023465, -0.248396756406779, 0.706975383619294, 0.921934115125161, 0.730859687119946, 0.229289313606257, 0.420363741611472, -0.12897523890352,
+#> 0.826396901122553, 0.635322473117339, 0.300942224108213, -0.630545612417209, 0.587553866116035, -2.08748812595697, 0.104359725056268, 0.691383178497781, 0.221764415744571, 0.339169106432873, 0.573978487809478, 0.750085523841932, 0.691383178497781, -2.06762705267733, -1.30449656320336, 0.052247050846062, 0.509408745749106, 0.600841084729715, 0.692273423710324, 0.509408745749106, -0.222049966095765, -2.14212908468855, -0.674002552799429, 0.377520491450707, 0.71551004138825, 0.490183674763221, 0.79061883026326,
+#> -0.336013002861886, 0.602846858075736, 0.94083640801328, 1.39148914126334, 1.01594519688829, -0.486230580611905, 0.640401252513241, -0.899328919424458, 0.227302913700687, 0.00197654707565821, -0.223349819549371, -0.110686636236856, -1.95085196367459, -2.51416788023717, -1.00209322610638, -0.855954630632534, 1.18998570600133, 0.678500621842862, -1.14823182158023, -0.490608141947916, 0.0208769422105495, 0.970777812790557, -0.563677439684839, 1.1169164082644, 1.84760938563364, -1.22130111931715, 0.0939462399474732,
+#> -0.636746737421763, -1.49393402925563, 0.532829768173274, 1.0395207175305, 0.605214189510021, 0.91888001530259, 0.774111172629097, 0.91888001530259, -0.577064692323509, -1.15614006301748, -0.191014445194193, 0.339804644608617, -1.71108729326587, -1.17617678381274, 0.617406581532201, 0.720882544917487, 0.841604502200319, -1.00371684483727, -0.145825273831926, -1.57237686566598, -1.85768718403279, 0.53891949024842, 0.862271184397473, 0.900312560179714, 0.919333248070835, 0.672064305486265, 0.729126369159627,
+#> 0.367733299228334, -0.355052840634254, -1.05881829260572, -3.16486428920225, 0.91510167861067, 0.412952021033696, -0.120581990141839, 0.350183313836574, 0.569873789026501, 0.601258142625061, 0.695411203420744, -0.559962940521692, -0.685500354915935, 0.318798960238013, 0.664026849822183, 0.664026849822183, 0.789564264216427, -0.905190830105862, 0.444336374632257, 0.726795557019305, -0.49719423332457, -1.21903436609147, -1.42673628656167, 0.592709436553808, 0.726069059778415, 0.707017685032043, 0.592709436553808,
+#> 0.802274558763905, 0.192630566879988, 0.630812186046553, 1.011839680974, 0.573658061807436, 0.84037730825665, 0.478401188075574, -0.778989545185005, 0.516503937568319, -0.302705176525695, -1.56009590978627, -1.82681515623549, -1.76966103199637, 1.01417007816696, 0.503214160922537, 0.162576882759589, 1.52512599541138, 0.588373480463274, -1.1999722298922, -0.0929010758626221, -0.178060395403359, 0.503214160922537, -1.79608746667736, -1.02965359081073, -1.76100548907541, 0.526091890800037, 0.780213821897308,
+#> 0.643378935921854, 0.760665981043672, 0.506544049946401, -2.05422310187995, 0.291517800556402, 0.350161323117311, 0.721570299336399, 0.760665981043672, 0.486996209092764, 0.702022458482763, -0.803161287247229, -0.74451776468632, -2.09331878358722, -0.0798911756626872, 0.584735413360946, 0.506544049946401, 0.565187572507309, 0.643378935921854, 0.526091890800037, -1.81964901163631, -1.38894168433749, 0.574362802946658, 0.888491520912122, 0.0508149396708839, 1.07173327305864, 1.07173327305864, 1.12408805938622,
+#> 0.574362802946658, -0.0538946329842709, 0.783781948256968, 0.495830623455292, 0.0508149396708839, -0.446555530441102, -0.315668564622158, -0.603619889423834, -1.86013476128569, -2.01719912026842, -2.41413998209374, -1.94171894192225, 0.543626530284297, 0.625786711183687, 0.646326756408535, 0.646326756408535, 0.584706620733992, -0.0931148716859753, 0.317686032810975, 0.625786711183687, 0.52308648505945, 0.666866801633382, 0.625786711183687, -0.62715604753201, -0.729856273656248, 0.0984533052354933,
+#> 1.32911962067916, -0.393813220941973, -1.03375970497268, -1.14979113471889, 1.23823660662034, 0.876414221568943, -1.10154815004537, 0.345741390160225, -0.209052933585252, 0.0582650938870843, 0.432826411732626, 0.283001884594409, -2.18910281318616, 0.957212256716383, 0.582650938870842, 0.957212256716383, -0.241383960389349, -0.840682068942215, -1.25337938547349, 0.322356407274612, -1.65606742139801, 0.707536267724148, 1.07520795269871, 0.882618022473937, 1.00517525079879, 0.479929986549422, 0.409897284649506,
+#> 0.812585320574022, -0.0278071022249666, 0.287340056324654, 0.427405460124485, 0.812585320574022, -1.28839573642345, -1.51600201759817, -1.48098566664822, -1.65257224878708, -1.74582943793025, 0.422400209648483, 1.44822929022337, 1.16845772279385, 0.772114668935376, -0.999771924784882, -1.16297200578543, -0.743314654641161, 0.119314344933175, 0.608914587934826, 0.515657398791654, 0.88868615536434, 0.842057560792754, 0.585600290649033, -0.626743168212196, -0.440228789925853, 1.01701759462732, 0.740589847250421,
+#> 0.363642919009189, 0.313383328577024, -0.515899913553687, -0.113823190096372, -1.77238967435779, 1.01701759462732, 1.09240698027557, -0.138952985312454, -0.842587251362754, 0.388772714225271, 0.363642919009189, -0.0384338044481257, 0.916498413762996, -0.214342370960701, -2.57654312127242, -0.41281931641801, 0.258886689957057, 0.762666194738358, 0.837300195446698, 0.669373693852932, 0.725349194384187, -1.90549933058483, -0.935257321376396, -1.8117080685115, -1.31995873562981, -1.17945892623504, 1.06853802408127,
+#> 0.295789072410041, 0.764121770392605, -0.266210165169037, 0.0850393583178868, 0.998288119383888, 0.951454849585631, 1.06853802408127, 0.717288500594349, 0.998288119383888, 0.0382060885196304, 0.0382060885196304, 0.600205326098708, -0.149126990673395, -0.921875942344627, -1.9756245128054, -1.2555955654474, -0.508464319891923, 1.04805910834866, 1.48388566825602, -0.321681508503053, -1.19333462831778, 0.549971611311672, 1.23484191973753, -0.570725257021546, 0.985798171219035, -1.00655181692891, -0.4462033827623,
+#> -1.35113797743927, 0.6426361131167, 0.186916320989622, -0.411215906177168, 0.101468859965795, 0.728083574140527, 0.272363782013449, 0.386293730045218, 0.6426361131167, 0.614153626108757, 0.614153626108757, 0.585671139100815, -0.297285958145399, -3.08856968492375, 0.728083574140527, -0.354250932161283, -2.36606623401964, -1.56122799144045, -1.01741836807614, -1.34370414209473, -0.408351589908111, 0.352981882801927, 0.614010502016797, 0.831534351362521, -0.0820658158895234, 0.831534351362521, 0.853286736297094,
+#> -0.343094435104393, 0.831534351362521, 0.809781966427949, 0.875039121231666, 0.461743807474789, 0.679267656820514, 0.679267656820514, 0.418239037605644, 0.505248577343934, 0.244219958129064, -1.86576138052447, -0.895511418302817, -1.56762233353222, 0.387609419862413, -0.437253976100949, -0.742758937568861, 1.42632628885331, 0.0821044583945013, 1.36522529655973, 1.88458373105518, -0.437253976100949, -0.498354968394531, 0.632013389036743, 0.754215373623907, -0.620556952981696, -1.26211737206431, -0.0706480223394546,
+#> -1.2730265498952, 0.750437654207517, 0.850774722179553, 0.349089382319374, 0.733714809545511, 0.917666100827577, 1.00128032413761, 1.00128032413761, 0.215306625023327, 0.817329032855541, 0.733714809545511, 0.666823430897488, 1.01800316879961, 0.767160498869523, 1.03472601346162, -0.87167827800706, 0.098246712389285, -1.2563037052332, -1.39008646252925, -0.804786899359037, -1.17268948192317, -1.40680930719125, -1.5405920644873, -1.23958086057119, -1.18271995280423, -0.643595699508518, -1.25623689643546,
+#> -0.27601098135235, -1.28074254431254, 1.78246344032219, 1.53740696155141, 1.53740696155141, -0.153482741966961, 0.557181046468296, 0.606192342222452, 0.214101976189206, 0.900260116747386, -0.790629586770985, -0.0554601504586498, 0.777731877361997, -0.202494037721117, -1.109203009173, -0.96216912191053, -1.18395945978514, 0.150490307469446, 1.14710469060894, 1.29913061346073, 1.1639964598147, -0.778556998847035, -1.21774299819664, 1.02886230616866, -0.863015844875806, -0.221128615057146, -0.525180460760722,
+#> 0.517474935414833, 0.787461858239964, -0.224989102354276, 0.584971666121116, 0.787461858239964, -1.43993025506736, -1.84491063930506, 0.0449978204708545, 0.787461858239964, -0.104261920216034, 0.575707124671146, 0.738899695444069, -1.95377772230916, 0.276520744920787, 0.466912077489197, -2.30768593284287, 0.482653266999817, -0.497736181593561, 0.180994975124931, 0.10558040215621, -1.85519849503055, -1.02563819237461, 0.558067839968538, 0.859726131843423, 0.482653266999817, 0.784311558874702, 1.16138442371831,
+#> 0.331824121062374, 0.482653266999817, 0.256409548093653, -2.29173466632114, 0.647147872095865, -0.287951117400454, 0.994470353908784, -0.207799775443626, 1.04790458188, 0.299825390282947, -0.0474970915299716, -0.154365547472408, -1.78091279213918, -0.145747347338745, -1.9106878274408, 0.139757730324824, 1.04818297743618, 0.477172822109041, 0.658857871531312, 0.451217815048717, 1.1779580127378, 0.632902864470987, 0.606947857410663, -0.457207432062638, -0.898442552088152, -2.21280359530271, -0.691193105214264,
+#> 0.970873737805419, -0.808240065990298, -1.5105218306465, 0.760189208408558, 0.221773188838801, 0.689961031942938, 1.06451130642625, 0.198363796683595, -1.27642790909443, 0.807007992718972, 0.409048326080456, 0.713370424098144, 0.947464345650213, 0.853826777029385, -1.34665608556006, 0.268591973149215, -0.0591395170236804, -2.37711952846585, 0.227554991837528, 0.658249203856198, 0.740286196621659, 0.781304693004389, 0.453156721942546, 0.740286196621659, 0.760795444813024, 0.166027247263433, -1.06452764421848,
+#> 0.248064240028894, 0.453156721942546, 0.760795444813024, 0.719776948430293, 0.637739955664832, 0.309591984602989, -1.86438832368172, -0.654342680391175, 0.535193714708006, -0.203139220181141, -2.02846230921264, -2.03727571839301, -0.196537186950855, 0.570437201150042, 0.417042323529863, 0.877226956390401, 0.647134639960132, 0.417042323529863, 0.263647445909683, 0.877226956390401, 0.417042323529863, 0.647134639960132, 0.493739762339952, 0.417042323529863, -0.0431423093306754, -1.88388084077283, -1.88388084077283,
+#> -1.99119420213523, -0.577820446966173, -0.318701925185179, -0.153808320415456, 0.647103474180342, 0.859109537455701, 0.835553308202883, 0.482209869410619, 0.741328391191613, 1.30667789325923, 0.293760035388078, 0.929778225214153, 0.458653640157801, 0.293760035388078, -1.37873224156197, -0.460039300702085, -1.96763797288241, -2.8913440905279, 1.0113499715795, -0.307127752105431, 0.589437100000324, 0.642176208947721, 0.325741555263337, 0.694915317895118, 0.800393535789913, 0.800393535789913, -0.51808418789502,
+#> -0.412605970000226, 0.167524228421145, -1.46738814894817, 0.85313264473731, 0.483958882105529, -0.307127752105431, -0.465345078947623, -1.76844624889515, 0.136034326838088, -0.136034326838088, -0.884223124447574, -1.08827461470471, -1.42836043179993, 0.952240287866618, 1.02025745128566, 1.08827461470471, 0.884223124447574, 0.476120143933309, 0.680171634190441, 0.816205961028529, -0.748188797609485, 0.651646784608955, 0.186777740811484, -0.830123292495484, 0.913135621745033, 1.26178740459314, -1.23688370581827,
+#> -0.946340553444852, -0.770585847699009, 0.654470172018337, 0.844477641313983, 0.876145552863257, 0.876145552863257, 0.274455233427045, -0.0105559705164246, 0.401126879624142, 0.147783587229947, -0.897257493896106, 0.179451498779221, -2.57565680600765, -1.51672044554308, 1.02547495710807, 0.954858418145543, -0.104389666292439, 1.09609149607061, 0.672392262295414, 0.601775723332882, 0.88424187918301, 0.88424187918301, 0.460542645407818, 0.248693028520222, 0.813625340220478, 1.44917419088327, 0.389926106445286,
+#> -1.16363775073042, -0.316239283180035, 0.107459950595157, 0.17807648955769, -0.739938516955228, -1.65795352346814, -1.23425428969295, -1.37548736761802, -1.65795352346814, -1.96145362051003, -0.846735432045663, -2.24520006848278, -0.34004534638004, 0.916546066070705, 0.612532014671331, 0.673334824951206, 0.73413763523108, 0.207179946138833, 0.207179946138833, 0.551729204391456, 0.754405238657705, 0.713870031804456, 0.85574325579083, 0.876010859217455, 0.288250359845332, -1.11021427659179, -0.887270638898913,
+#> -2.09673742461792, -0.0246674991131521, -0.907215800717036, 0.301491655827414, 0.646836643411542, 0.128819162035349, 0.359049153758102, 0.742765806629356, 0.627650810767979, 0.666022476055105, 0.666022476055105, 0.493349982263041, 0.570093312837291, -2.17348075519217, -1.23627015218017, -1.12221557471379, -0.193485443916171, 1.1588759746137, 0.507135531948701, 0.621190109415076, 0.409374465548952, 0.8330057532812, 1.17516948568032, 1.01223437501407, 1.1588759746137, 0.230145843816077, -0.633410242715045,
+#> -1.28515068538004, -1.31773770751329, -1.31773770751329, -1.56040706208943, 0.136346248143737, 1.55030734000471, -1.56040706208943, 1.05542095785337, 0.984722903260322, 0.772628739481175, 0.419138466515932, -0.00504986104236073, -1.34831289831029, 0.419138466515932, 0.065648193550688, -0.00504986104236073, -0.924124570751994, -2.40573495736485, -1.28775141435537, 0.720478283272778, -2.34362476053099, 0.430630698048097, 0.679071485383538, 0.472037495937337, 0.699774884328158, 0.575554490660438, 0.699774884328158,
+#> 0.658368086438918, 0.658368086438918, 0.451334096992717, 0.575554490660438, 0.616961288549678, 0.554851091715818, -0.00414067978892407, -0.293988265013605, -0.977200430186067, -0.480318855515186, -1.95938387064379, 0.937705138093815, 0.811744746409571, 0.685784354725327, 0.0559823963041082, 0.811744746409571, 0.307903179672596, -0.699779953801355, -0.951700737169843, -1.91247695378004, 0.898512794558076, 0.968787538266529, 0.406589588598906, 0.757963307141171, 0.617413819724265, 0.757963307141171,
+#> 0.195765357473547, 0.0552158700566415, 0.336314844890453, -0.0150588736518114, 0.266040101182, -1.91247695378004, -1.42055374782087, -1.34072765309309, -0.387554087222221, -1.20456000082582, -0.115218782687687, 0.42945182638138, 1.04220626158408, 1.11029008771771, 0.769870957049547, 0.565619478648647, 0.633703304782281, 0.633703304782281, -0.047134956554054, -2.08964974056306, 0.602388270067164, -0.183335560455224, 0.22738371459057, 0.83453394726696, 0.280955793944369, 0.495244111359566, 0.780961867913161,
+#> 0.780961867913161, 0.780961867913161, 0.745247148343962, 0.763104508128561, -1.576209623654, -1.37977866602341, -1.25477714753121, -1.8976420997768, -0.471455116843649, -0.172118534720697, 1.06264486653648, 0.314303411229099, 0.65105706611742, 1.3993985214248, -1.3694648632125, 0.763308284413527, -0.695957553435862, -1.48171608150861, -2.61405121193809, -0.00229101771423132, 0.203900576566599, 0.730834650839833, 0.455912525132059, 0.639193942270575, 0.707924473697518, 0.272631107993543, 0.203900576566599,
+#> -0.597955623414409, 0.655018043333513, 1.66273811000046, 0.151158010000041, 0.755790050000207, -2.26737015000062, -0.856562056666902, 0.655018043333513, 0.957334063333596, 0.957334063333596, -0.0503860033333472, -1.25965008333368, 0.0503860033333472, -0.655018043333513, -1.56196610333376, -0.655018043333513, -0.251930016666736, -0.453474030000124, 1.05810607000029, 0.856562056666902, 0.251930016666736, 0.506157964289507, 1.27016998585857, 0.276954357818787, 0.506157964289507, -0.716261270221, -1.40387208963316,
+#> 1.04096637938785, 1.49937359232929, 0.276954357818787, -0.639860068064094, 0.506157964289507, -1.48027329179007, 0.582559166446414, -1.32747088747625, -1.32747088747625, 0.4297567621326, -1.91827062322148, -0.329912690841981, 0.889719292949416, 0.294085068307105, 0.832992223935862, 0.662811016895202, -0.0462773457742147, 0.379175671827435, 0.889719292949416, 0.549356878868095, 0.464266275347765, 0.322448602813882, 0.265721533800329, -0.188095018308098, 0.719538085908755, 0.520993344361319, -0.528457432389418,
+#> -0.812092777457185, -2.96772139997221, -1.27799973265588, -0.718632068514706, -1.38288116968235, -1.43532188819559, -1.01579614008971, 1.13427331895294, 1.02939188192647, 1.06435236093529, 0.959470923908824, 0.941990684404412, 0.994431402917647, 0.802148768369118, -0.508869194461765, 0.452543978280882, 0.994431402917647, -0.893434463558824, -0.683671589505883, -0.45642847594853, -1.52827944915564, 0.716522709099676, -0.306109385216634, 0.516984739476982, 0.816291693911024, 1.06571415593939, 1.1405408945479,
+#> 0.467100247071308, -0.380936123825144, -0.954607786490391, -1.55322169535848, -1.09546690789069, -0.22086026368764, 0.971785160225614, 0.733256075442963, -0.22086026368764, -1.01595721296314, 1.13080455008071, 1.28982393993582, 0.892275465298064, 0.653746380515413, 0.574236685587863, 0.574236685587863, -1.49301538252844, -1.89056385716619, -1.41350568760089, -0.37987965354274, 0.415217295732762, 0.494726990660313, -1.36557239795181, 0.626596811030258, 0.192406085995704, 0.67767807279903, 0.575515549261487,
+#> -0.318406531692006, -0.931381672917259, 1.2651125831399, 1.31619384490867, 0.141324824226933, 0.67767807279903, 0.396731133070789, -0.063000222848151, -0.931381672917259, -2.25949447890531, -1.63507634870588, 0.465502163332634, 0.410223781436884, -0.30839518320787, 0.576058927124135, 0.354945399541134, 0.299667017645384, -1.41396282112288, 0.797172454707136, 1.07356436418589, 0.465502163332634, 0.410223781436884, 1.62634818314339, 1.46051303745614, -0.142560037520619, -0.750622238373873, -1.52451958491438,
+#> -1.30340605733138, -0.861179002165374, -0.452988254166852, 0.634183555833593, 1.08717181000045, 1.5401600641673, 0.543585905000223, 1.17776946083382, -0.181195301666741, -0.815378857500334, 0.362390603333482, -0.634183555833593, -0.362390603333482, -0.905976508333704, -1.99314831833415, -1.25745023763369, 0.244338671767683, -1.13230116185024, -0.506555782933002, 0.619785899118025, 0.744934974901472, -1.25745023763369, 1.24553127803526, 0.87008405068492, 0.87008405068492, 1.12038220225181, 0.244338671767683,
+#> 0.744934974901472, 0.494636823334578, 0.119189595984235, 1.24553127803526, 0.244338671767683, -0.13110855558266, -1.38259931341713, -1.00715208606679, -2.13349376811782, -0.364033763812126, -1.03214278916144, -1.97863057507297, 0.248399509424745, 0.415426765762073, 0.638129774211844, 1.64029331223581, 0.638129774211844, -0.197006507474798, 0.972184286886501, -1.3661973018361, 0.526778269986958, -0.141330755362355, -2.66878014958248, 0.264985263079112, 0.619876240417207, 0.714513834374033, -0.799687668935176,
+#> 0.312304060057524, 0.66719503739562, 0.66719503739562, 0.643535638906414, 0.454260450992763, 0.66719503739562, -1.48581022512216, 0.714513834374033, -0.0662463157697778, -0.70505007497835, -1.11927783281743, -1.13736502213102, -0.0159592846884614, 0.580917962659999, 1.43101586039871, 1.30440553520359, 1.43101586039871, 1.34057991383077, 1.06927207412692, -0.0702208526292305, -0.10639523125641, -0.178743988510769, -0.902231561054356, -0.558574964096152, -0.884144371740767, -0.956493128995126, -1.22780096869897,
+#> -1.52724521216179, 0.256890476712341, 0.629694949014398, -1.2609563033746, 0.363406040227215, 0.496550494620806, 0.60306605813568, -0.222429559104589, 0.469921603742088, 0.709581621650553, 0.629694949014398, 0.390034931105933, 0.390034931105933, 0.656323839893116, -0.0360273229535603, 0.416663821984651, -2.96520531961258, -0.614152074541446, -0.562972734996326, 0.511793395451205, 0.92122811181217, 1.02358679090241, 1.07476613044753, 0.870048772267049, 0.614152074541446, 0.255896697725603, 0.870048772267049,
+#> 0.102358679090241, 1.07476613044753, 0.767690093176808, 0, -1.89363556316946, -1.53538018635362, -1.33066282817313, -1.43302150726337, -0.716510753631687, -0.639725899121016, -1.58343502690237, 0.594355267977681, 0.449169248319011, 0.812134297465687, 0.231390218831006, 1.32028536627103, 1.17509934661236, 1.39287837610037, 0.521762258148346, -0.930097938438356, -0.42194686963301, 0.231390218831006, -0.27676084997434, -1.14787696792636, -1.72862104656104, -3.18201776236809, 0.504733851961835, 0.476803915489639,
+#> 0.476803915489639, 0.476803915489639, 0.532663788434031, 0.504733851961835, 0.476803915489639, 0.532663788434031, 0.448873979017442, -0.752113289287002, -0.165584623370878, -0.30523430573186, -0.0259349410098963, -1.76115497240586, -1.06620285453024, -1.72457854514925, 0.726042081043746, 0.780906721928664, 0.835771362813582, 0.79919493555697, 0.780906721928664, 0.598024585645604, 0.70775386741544, 0.70775386741544, 0.70775386741544, 0.21397209945118, 0.104242817681344, 0.689465653787134, 0.744330294672052,
+#> -0.0237746777167977, -0.608997513822588, -1.94403710868892, -1.2673732044416, -1.41094650429791, -1.43439713871837, -1.38749586987744, -0.238414783274716, -0.308766686536107, 0.746511862384766, 0.793413131225694, 1.54383343268054, 1.61418533594193, 0.207147270714097, -1.05918698799095, 0.746511862384766, 1.98939548666935, -0.0273590734905411, 0.300949808395953, -1.08263762241141, 0.676159959123375, 0.746511862384766, 0.535456152600592, -0.285316052115644, -0.168062880013324, -0.941933815888632, -0.426019858638427,
+#> -1.12953889125234, -1.98080668364863, -1.90447501953886, -1.14115837844112, 0.23281157553481, 0.690801560193453, 1.07245988074232, 0.843464888413001, 1.1487915448521, 0.385474903754358, 0.690801560193453, 0.461806567864132, 0.0801482473152626, 0.385474903754358, 0.309143239644584, 0.23281157553481, -0.683168393782476, 0.767133224303227, 0.538138231973906, -0.148846745014059, -1.98080668364863, -1.89446769511252, -0.595013319403572, 1.04640273412352, 0.841225727432637, 0.772833391869008, 0.978010398559895,
+#> -0.253051641585427, -0.595013319403572, 0.63604872074175, -0.936974997221717, -1.32890593998002, -1.89079234413264, -1.81052285782512, 0.91863967663048, 0.998909162937998, 0.838370190322962, 0.517292245092892, -0.0445941590597322, 0.758100704015445, 1.07917864924552, 0.517292245092892, 0.838370190322962, 0.437022758785374, 0.196214299862821, 0.276483786170339, -1.48944491259505, -0.445941590597321, -0.365672104289803, -1.91710970320723, -0.00799211965901917, -0.0289714337639446, 0.558449361173967,
+#> 0.663345931698594, 0.474532104754265, 1.04097358558725, 0.936077015062624, 0.201801021390235, 0.768242502223221, 0.180821707285309, 0.642366617593668, 0.705304559908445, 1.04097358558725, 0.831180444537997, 0.474532104754265, -1.43458547879395, -0.448557715862453, -1.43458547879395, -1.28773028005947, -1.95906833141708, -1.94857598045625, -1.03016984502924, 0.631707923838686, 0.67544154933521, 0.981576927810881, 0.741041987579997, 0.67544154933521, -0.527233151819211, -0.199230960595278, -1.54510419691579,
+#> -0.59745443877994, -0.174036461740515, -1.48461591448159, 0.330032558544514, -1.36363934961318, 0.289707036921711, 0.934915382886549, 1.03572918694355, 1.17686851262336, 0.995403665320752, 0.894589861263746, 0.995403665320752, 0.672799492338334, 0.370358080167316, 0.168730472053304, 0.188893232864706, -1.32331382799038, -1.5652669577272, 0.768193231375265, -2.31893844611412, 1.19895579102495, 0.696399471433652, 0.26563691178397, 0.552811951550425, 0.122049391900743, -0.739475727398619, -0.380506927690552,
+#> -0.165125647865711, -0.957069010729856, -1.24544351614628, 0.100304175797016, -2.11056703239553, -1.5338180215627, -1.5338180215627, -0.28419516475821, 0.484803516352242, 1.06155252718508, 0.484803516352242, 0.484803516352242, 0.773178021768661, 1.25380219746269, 1.92667604343434, 1.25380219746269, 0.677053186629855, 0.100304175797016, 0.00417934065820908, -0.188070329619404, -0.188070329619404, -0.476444835035823, -0.380319999897017, 0.292553846074629, -2.49595871125275, -0.334653681955676, 0.943537464402809,
+#> 0.0371837424395195, 0.0139439034148197, 0.385781327810016, 0.92029762537811, 0.89705778635341, 0.130143098538318, 0.804098430254611, -1.35720659904247, -1.33396676001777, 0.618179718057013, 0.409021166834715, 0.362541488785316, -1.77049813559112, -1.95269225366042, 0.506928340275181, 0.707341870151415, 0.506928340275181, 0.652683634730624, 0.689122458344484, 0.634464222923693, 0.543367163889041, 0.288295398592016, 0.288295398592016, 0.743780693765276, 0.379392457626668, 0.725561281958345, 0.0878818687157819,
+#> -1.0417216633139, -1.98913107727428, -1.95663852552725, -0.414178957958323, 0.328486759760049, 0.499871156156596, -0.185666429429593, 0.785511816817509, 0.58556335435487, -2.1280229219238, 1.18540874174279, 0.471307090090505, 0.614127420420961, 1.15684467567669, 0.871204015015782, 0.471307090090505, 0.614127420420961, 0.299922693693958, -0.328486759760049, -0.0714101651652281, -1.7852541291307, -1.01402434534624, -1.85217595027872, 0.115381452640314, 0.290275444010894, 0.902404413807927, 0.771233920279991,
+#> 0.924266162729249, 0.924266162729249, -0.868397248819203, 0.661925175673378, 1.05543665625718, 0.989851409493217, 0.793095669201314, -0.103236036572912, -0.0813742876515898, -0.299991776864816, -1.3493557250883, -0.999567742347139, -1.87403769920004, -1.29263422336127, -1.37418843303706, -1.4353540902939, 0.114175893546106, 0.175341550802948, 0.807386675790321, 0.868552333047163, 1.27632338142611, 1.54137456287243, 1.09282640965559, 0.888940885466111, 1.17438061933138, 0.705443913695583, -0.0897096306433691,
+#> -0.150875287900212, -0.823697517725479, -1.21108001368548, -0.456703574184424, -0.762531860468637, -1.0479715943339, 0.561840608296166, 0.16855218248885, 0.3371043649777, 0.477564517051741, 0.589932638710975, 0.449472486636933, 0.224736243318467, 0.702300760370208, 0.449472486636933, 0.421380456222125, 0.0280920304148083, -1.96644212903658, -2.44400664608832, 0.889561155981108, 0.90868171306975, 0.793958370537898, 0.0100155299035743, 0.258582772055921, 0.71747614218333, 0.621873356740119, 0.430667785853699,
+#> 0.927802270158392, 0.774837813449256, 0.621873356740119, 0.430667785853699, 0.71747614218333, -0.0473461413623518, 0.373306114587773, -0.238551712248772, -1.8446785076947, -1.30930290921273, -1.8446785076947, -1.2519412379468, -1.94028129313791, -2.39744443844599, -0.43654604322025, 0.667867995470111, 0.758024243526467, 0.667867995470111, 0.600250809427844, 0.622789871441933, 0.329782065258776, 0.555172685399666, -0.43654604322025, -1.65365539198106, 0.6904070574842, 0.667867995470111, 0.262164879216509,
+#> 0.6904070574842, 0.600250809427844, 0.600250809427844, -0.932405407530208, -1.85650695010786, -1.68022919562286, 0.507976268444122, 0.644739109948308, 0.507976268444122, 0.507976268444122, 1.05502763446087, 0.439594847692029, 1.60207900047761, 0.576357689196215, 1.05502763446087, 1.19179047596505, 1.12340905521296, -0.312600780580998, -0.517745042837278, -0.722889305093558, -0.654507884341464, -0.859652146597744, -0.791270725845651, -0.791270725845651, -0.928033567349838, -1.95375487863124, -1.81238578188058,
+#> -1.81238578188058, -1.62724959986052, 0.335193929552107, 1.00168418482432, 1.07573865763234, -0.257241852912082, 0.631411820784202, 0.742493529996238, 1.05722503943034, 1.02019780302633, 0.205598602138066, -0.534946125942171, 0.798034384602256, -0.997786580992319, -0.683055071558219, 0.835061621006267, 0.335193929552107, -0.3127827075181, 1.02056384634248, 1.02056384634248, 0.343806969512538, 0.821517706098382, 0.124856215244027, -1.54713136280642, 0.662280793903101, -0.492186819512687, 0.50304388170782,
+#> -0.611614503659148, -1.84570057317258, -2.54872259451009, 0.278738067877086, 0.366185304858133, 0.832570568757048, 0.86171964775073, 0.803421489763365, 0.715974252782319, 0.628527015801272, 0.191290830896039, -0.479137985958651, -0.974672328851248, 0.59937793680759, 0.511930699826543, -0.508287064952333, 0.453632541839179, -1.73254838268699, -1.07538198315771, 0.996454865127785, 0.937259526605342, 0.966857195866563, 0.434099149164579, -0.986588975374045, -0.720209952023052, -0.542623936455724, 1.52921291182977,
+#> 1.41082223478488, 0.256513133597251, -0.749807621284274, -0.986588975374045, -0.00986588975374051, -1.46015168355359, -0.238126207819367, 0.531204617443203, 1.10820273639013, 0.723537323758845, 1.17231363849534, 1.4287572469162, 0.531204617443203, -0.109904403608939, 0.467093715337989, -1.07156793518715, -0.430458914135009, -1.45623334781844, -1.32801154360801, -1.32801154360801, 0.759676616838904, 0.132969177167189, 0.720507401859422, 0.407153682023565, 0.622584364410716, 0.544245934451752, -1.06169187970702,
+#> -1.49255324448132, -0.278307580117373, 0.955522691736315, 0.935938084246574, 0.602999756920975, 0.563830541941493, 1.03386112169528, 0.818430439308127, -0.317476795096856, -1.84507617929666, -1.74715314184795, -1.35546099205313, 0.581425252010545, 0.540000552121753, 0.643562301843733, 0.457151152344169, 0.560712902066149, 0.705699351676921, 0.540000552121753, -0.184931695932107, -2.13189259070533, -0.143506996043315, 0.560712902066149, 0.250027652900209, 0.00147945356745681, -2.38044079003808, 0.0672118680416125,
+#> 0.290184573132042, -0.135490591131505, 0.614508507809029, 0.918562196568705, 0.979372934320641, 0.7361299833129, -1.14900288699709, -0.358463296221934, 0.817210966982147, 0.878021704734082, 0.959102688403329, 0.634778753726341, 0.26991432721473, -0.480084771725804, 0.533427524139782, -1.79765075635107, -1.83819124818569, -1.93954247777225, -1.42516133651675, 0.0457620612642993, 0.568757047142007, 0.911972506624252, 0.33994674082051, 0.911972506624252, 0.83025454008086, -1.37613055659072, 0.585100640450685,
+#> -1.3924741498994, 0.841105721741088, 0.841105721741088, 1.42872752734103, 0.25348391614115, 0.547294818941119, 1.33079055974104, 0.449357851341129, 0.743168754141098, 0.841105721741088, -1.41144453305867, -0.138263954258809, -0.138263954258809, -0.432074857058778, -1.2155705978587, -1.11763363025871, -1.31350756545869, -1.50938150065866, 0.919027293458035, 0.753436790132263, 0.505051035143605, 0.339460531817833, 0.256665280154947, 0.256665280154947, 0.670641538469377, -0.0745157264965973, -1.64762550809143,
+#> -1.97880651474298, -1.90430135461542, 0.0625553538949298, -0.788488414210511, 0.724478284643606, 0.800126619586312, 0.781214535850636, 0.875774954529018, 0.9703353732074, 0.157115772573312, 0.592093698493871, 0.251676191251694, -0.693927995532129, -1.82865301967272, 0.624442710544553, -1.69848417268118, -0.274754792639603, 0.999108336871284, 0.399643334748514, 0.999108336871284, -1.62355104741584, 0.999108336871284, 0.924175211605938, 0.924175211605938, 0.0999108336871284, -1.02408604529307, -0.424621043170296,
+#> 0.399643334748514, -1.32381854635445, -1.391923235247, 0.135215399995423, 0.771523164679766, 1.0260462705535, 0.898784717616634, 0.644261611742897, -1.07376935290483, -1.01013857643639, -2.03144345313023, -2.08476492307858, -0.0230014184090917, 0.49243945775828, 0.49243945775828, 0.474665634442164, 0.474665634442164, 0.474665634442164, 0.49243945775828, 0.510213281074396, 0.439117987809931, 0.474665634442164, 0.385796517861582, 0.49243945775828, 0.527987104390512, 0.527987104390512, -2.12031256971081,
+#> 0.809394446437398, 0.767887038927788, 0, 0.643364816398957, 0.560350001379737, 0.394320371341296, 0.539596297624932, 0.477335186360517, 0.145275926283636, 0.290551852567271, 0.705625927663373, 0.207537037548051, -1.28672963279791, -2.11687778299012, -2.13763148674492, -1.79982908458138, -0.967858783542223, -0.343881057762853, 1.11206696905568, 0.696081818536097, 0.696081818536097, 1.32005954431547, 1.32005954431547, 0.904074393795887, 0.626750960116167, 1.04273611063575, 0.210765809596587, -0.0665576240831328,
+#> -1.31451307564187, -0.759866208282433, -0.759866208282433, -1.31451307564187, -0.621204491442573, 0.626750960116167, 1.45872126115533, 0.834743535375957, -0.343881057762853, 0.00277323433679714, -1.10652050038208, -1.45317479248173, 1.17739701726467, 0.906731036284284, 0.636065055303901, 0.703731550548997, 0.500732064813709, 1.10973052201957, -0.987930830578399, -0.581931859107824, 0.568398560058805, 0.433065569568613, -1.52926279253917, -1.73226227827445, 0.636065055303901, -1.19093031631369, -0.64959835435292,
+#> -1.49388630466183, 0.708084838047801, 1.58887329513165, 0.414488685686518, 0.854882914228443, -0.0259055428554078, 0.267690609505876, 0.267690609505876, -0.319501695216691, -0.466299771397333, 0.120892533325234, -0.613097847577975, 0.854882914228443, 1.00168099040908, -0.319501695216691, -0.17270361903605, -2.66827091410696, -2.76943102417596, 1.80192184937142, 0.926556405500646, 0.05119096162987, 0.73203075130714, 0.537505097113634, -0.0460718654668829, 0.342979442920129, 0.829293578403893, 0.342979442920129,
+#> -0.143334692563636, -0.0460718654668829, -1.01870013643441, -0.921437309337659, 0.342979442920129, 0.73203075130714, 0.05119096162987, -0.435123173853894, -1.31048861772467, 0.555728976330073, 0.772992970307259, 0.713739153768026, 0.693987881588282, 0.575480248509818, 0.674236609408538, 0.753241698127515, 0.753241698127515, 0.595231520689562, 0.456972615431353, 0.63473406504905, 0.753241698127515, 0.63473406504905, 0.180454804914935, -0.530590993555853, -2.0711902235759, -0.412083360477389, -0.0368091890622503,
+#> -0.668849898814062, -0.649098626634318, -2.11069276793538, -2.26870294537334, -2.70694939945624, -1.03666972236472, 0.227325708947784, -0.56267143562253, 0.61103860773908, 0.588467260751357, 0.61103860773908, 0.701323995689973, 0.67875264870225, 0.701323995689973, 0.00161223907055162, 0.67875264870225, 0.498181872800463, -0.991527028389272, 0.113954953253457, 0.354526521232977, 0.667269559606353, 0.234240737243217, 1.14841269556539, -1.42570308181547, 0.955955441181777, 0.955955441181777, 0.643212402808401,
+#> 0.835669657192017, 0.282355050839121, 0.787555343596113, 0.258297894041169, 0.306412207637073, 0.113954953253457, -0.992674259452335, -1.85873190417861, -1.83467474738066, -1.54598886580523, 1.03561554137442, 1.07320919110452, 1.05441236623947, -0.505724097559678, 1.11080284083462, 0.73486634353362, 0.490507620287971, 0.84764729272392, 0.509304445153021, 0.208555247312221, 0.640882219208371, 0.97922506677927, 0.321336196502521, -0.430536798099478, -1.42676851594713, -0.750082820805327, -1.72751771378793,
+#> 0.114571122986971, -1.50195581540733, -1.42676851594713, -1.35158121648693, -0.650896471315585, -0.517866535572254, -0.916956342802248, 0.812432821861059, 0.745917853989393, -1.04998627854558, -0.11877672834226, 1.01197772547606, 1.47758250057772, 1.54409746844938, -1.31604615003224, 0.0142532074010713, 0.280313078887734, -1.31604615003224, -1.38948081465941, 1.14783197732734, 0.302061046665088, -0.604122093330177, 0.543709883997159, 0.383132222048786, -0.0729775661045307, 0.109466349156796, 1.29535179835542,
+#> -1.80619476108713, 0.0182443915261326, 1.02168592546343, 0.930463967832765, 0.383132222048786, -2.07986063397912, 0.656798094940775, 0.383132222048786, 0.291910264418122, -1.35008497293382, -0.164199523735194, -1.78758422732211, -0.136231959651736, -0.495221583058339, 0.103094455952665, 0.940736910568071, 0.84500634432631, 0.509949362480148, 0.557814645601028, -0.375558375256138, 1.08433275993071, 0.988602193688952, -2.00297800136607, -0.231962525893497, 0.182029457347664, 0.518388237229218, 1.12383404101601,
+#> 0.451116481252907, 1.0565622850397, 0.854747017110771, 1.12383404101601, 0.0474859453950427, 0.249301213323975, 0.451116481252907, 0.383844725276596, 0.0474859453950427, -0.759775126320686, -1.29794917413117, -0.356144590462822, -2.1052102458469, -1.97066673389428, -1.45927615769871, -0.164695209399067, 0.731553139423762, 0.68176156448916, 1.05519837649867, 0.482595264750754, 0.930719439162168, -0.811985683548887, 0.831136289292965, 0.68176156448916, -0.338965721670172, -0.513236233941278, -2.10656663184853,
+#> 0.221458438814089, 0.199140921724297, -0.157939351712373, -1.16222762075301, 1.20342919076493, 0.890983951507845, 0.0652358191855455, 1.69441456674035, -0.715877278957171, 1.09184160531597, -1.02832251821426, -1.20686265493259, -1.09527506948363, -2.40344484809927, -2.34195635782025, 0.0151024362088825, 0.220064070472285, 0.650483502425431, 0.670979665851772, 0.650483502425431, -0.435813159170604, 0.609491175572751, 0.670979665851772, 0.650483502425431, 0.56849884872007, 0.650483502425431, 0.445521868162029,
+#> 0.609491175572751, -0.087378380922819, 0.343041051030327, 0.0970870899142436, -1.58359831104566, -0.95979584384621, -1.86106755087253, 0.821288720039135, 1.10025377221395, 0.885665270541015, 0.435029417027855, 0.134605514685749, 0.392111716693269, 0.435029417027855, 0.370652866525975, -0.401865739496584, 0.327735166191389, 0.456488267195149, -0.058524136819891, 1.05733607187936, 1.01441837154477, 0.499405967529735, 0.284817465856802, 0.499405967529735, -1.58210249869772, -1.66793789936689, -2.18295030338193,
+#> -2.37302626129986, 0.701537326605359, 0.579530835021818, 0.750339923238775, 0.67713602828865, 0.506326940071694, 0.384320448488153, 0.408721746804861, 0.55512953670511, 0.0183009737375311, -1.42137562694825, -0.786941870713837, -0.221645296712078, 1.10822648356039, 1.47763531141385, 1.0343447179897, 0.517172358994849, -0.591054124565542, 0.295527062282771, -0.295527062282771, -1.92092590483801, -0.738817655706927, -0.664935890136234, -0.564947171510996, -0.854663669721763, 0.0144858249105386, -0.130372424194845,
+#> -0.420088922405612, 0.738777070437456, -1.57895491524868, 0.738777070437456, 2.04250131238591, 0.0144858249105386, -1.20374937717857, -1.16521126152502, 0.569003942884784, 0.800232636806091, 0.607542058538335, 0.877308868113193, 1.1085375620345, 0.0680084393886196, 1.64807118118422, 1.1085375620345, -0.548601411068198, 0.800232636806091, -1.04959691456436, -0.240296485839789, -1.12667314587146, -1.16521126152502, -1.08813503021791, -1.22067891656527, 1.11223810086411, 1.06329578581314, 1.17749452093206,
+#> 1.11223810086411, 0.867526525609276, -1.10648018144634, 0.769641895507345, -1.20436481154828, -0.421287770732823, 0.0355071697428575, 0.443359795167573, 1.11223810086411, -0.502858295817767, -1.12279428646333, -0.796512186123561, -1.3185635466672, 1.13744027230147, 0.776348122364495, 1.67907849720693, 0.0541638224905457, 0.234709897459033, -0.848566552351891, -0.306928327446429, -1.20965870228886, -0.126382252477942, -1.39020477725735, -1.96956469265051, -0.868993036687478, -1.85950752705421, 0.341635784871858,
+#> 0.85523589098794, -0.648878705494871, 0.708493003526202, 0.85523589098794, 1.47889316270033, 0.708493003526202, 0.671807281660768, 0.415007228602727, -0.355392930571396, 0.451692950468161, 0.0848357318138171, -0.868993036687478, -1.32363469024048, 0.54792319735536, 0.35091710392422, 0.252414057208649, 0.646426244070931, 1.13894147764878, 1.53295366451106, 0.843432337502072, 0.843432337502072, 0.54792319735536, -0.929622503378196, -0.437107269800344, -0.240101176369203, -0.732616409947055, -0.929622503378196,
+#> -2.11165906396504, -1.10449223077674, -1.21166667904618, -1.30097871927071, -0.800831294013323, 0.59243653348941, 1.30693285528568, 1.05685914265699, 0.949684694387547, 1.19975840701624, -0.675794437698975, -0.0506101561272359, 0.0387018840972982, -1.91773825146619, -1.61191952697988, -0.942941067166098, 0.146538138816353, 0.739061917508564, 0.815516598630139, 0.547925214704625, 0.834630268910533, 0.739061917508564, 0.758175587788958, 0.700834576947776, 0.853743939190927, 0.758175587788958, 0.739061917508564,
+#> 0.261220160498717, 0.643493566106594, 0.471470533583049, -1.53546484585831, -0.770918034642553, -1.82216990006422, -0.40775829931507, 0.617115244815363, 0.384659278158455, 0.694600567034332, 0.655857905924847, 0.617115244815363, 0.67522923647959, 0.404030608713197, 0.636486575370105, 0.713971897589075, 0.287802625384743, -1.84304373563691, -0.622649910688146, -1.06819051344722, -2.15298502451279, -1.29388852711934, -1.78715981311792, -0.819589213659172, 0.736112534490182, 0.906860287335843, 0.944804232412657,
+#> 0.698168589413369, 0.868916342259029, 0.394617028798861, 0.717140561951775, -0.47809370796785, 0.793028452105403, 0.698168589413369, 0.698168589413369, 0.812000424643809, 0.698168589413369, -1.16108471935049, -0.895477103812799, -0.572953570659884, -1.95790756596358, -1.79048613905653, -0.580117509054317, -0.487012229823377, 0.909566958640719, 1.0957775171026, 0.257830004024141, 1.0957775171026, 0.6302511209479, 1.37509335479542, -0.207696392130558, -1.51117030136371, -0.393906950592437, -0.393906950592437,
+#> -0.146959163096225, 0.0228603142594129, -1.16587602723005, 0.744593093020875, 0.914412570376512, 0.956867439715422, 1.02054974372379, 0.553546180995782, 0.808275397029239, 0.00163287958995813, -1.84515393665261, -0.16818659776568, -1.69656189396642, -2.29737402154632, -0.584380576354502, -2.01187511401435, 1.3427370494863, 0.414865600007395, 0.914488688188343, 0.272116146241409, 0.414865600007395, 0.272116146241409, 0.771739234422357, 0.486240326890387, 0.486240326890387, -0.298881668822532, 0.700364507539365,
+#> -0.727130030120487, -0.156132215056546, 0.299931863220136, -1.01976833494846, 0.563871902853855, -0.359918235864162, -0.227948216047303, 1.35569202175501, 1.48766204157187, -0.755828295314741, 0.827811942487574, -0.491888255681022, -1.67961843403276, -0.109490416580693, 0.259319407691115, -0.293895328716597, -3.05996901075516, 0.996939056234732, 0.812534144098828, 1.36574888050654, 0.628129231962923, 0.443724319827019, 0.167116951623163, 0.074914495555211, -0.662705152988405, -0.662705152988405,
+#> -0.386097784784549, 0.535926775894971, -0.109490416580693, -1.18097940396086, 0.856493050156921, 1.23380276388244, 1.08287887839223, 0.856493050156921, 1.15834082113733, 0.705569164666715, 0.705569164666715, 0.781031107411818, 0.931954992902025, -0.577283862000039, 0.177335565450993, -0.954593575725555, -1.48282717494128, 0.101873622705889, 0.101873622705889, -0.426359976509833, -0.954593575725555, -1.86013688866679, -1.25644134670597, -0.518109692410164, 1.04007867489415, 1.16840006984862, 1.02174704704351,
+#> 1.13173681414734, 1.09507355844606, 0.416803327972423, 0.490129839374979, -1.15971666718253, 0.453466583673701, 0.416803327972423, 0.673446117881368, -1.23304317858508, -0.133145507546746, 0.435134955823062, -0.77475248231911, -1.43469108494211, -1.47135434064339, -1.6180073634485, -0.923167046074535, 1.12182324586273, 0.876424410830255, 0.712825187475274, 0.958224022507746, 0.631025575797784, 0.385626740765312, 0.631025575797784, 0.467426352442803, -0.0233713176221401, -1.41396471613948, -0.268770152654611,
+#> -1.08676626942952, -2.0683616095594, -1.96388710379263, -0.616208368910102, 0.447748527049786, 0.731470365972423, 1.65356634247099, 1.08612266462572, 0.802400825703082, 0.518678986780445, 0.164026688127149, 0.376818067319127, 0.305887607588468, 0.589609446511105, -0.970860667563398, -1.18365204675538, -0.545277909179443, -1.39644342594735, -1.60178218610509, 0.744716367086934, 0.72652645582188, -0.00106999478029738, 0.744716367086934, 0.72652645582188, 0.453677786846063, 0.708336544556826, 0.781096189617043,
+#> 0.3991080530509, 0.362728230520791, -1.85644094381585, 0.762906278351989, 0.72652645582188, -1.20160413827389, -0.692286622852366, -1.78368129875563, -0.925589913384917, 0.102843323709435, 0.994152129191208, 1.13127656080379, 1.26840099241637, 0.582778834353466, 0.994152129191208, -0.994152129191208, -0.651341050159757, -0.582778834353466, -1.40552542402895, 0.582778834353466, 0.514216618547176, -1.61121207144782, -1.17931901477033, 0.900502378690442, 1.08135641290442, 1.08135641290442, 1.17178343001141,
+#> 1.08135641290442, -0.00376779237945786, -0.636756912128387, -0.365475860807418, -0.772397437788872, -1.17931901477033, -1.17931901477033, -2.07579884091657, -0.673569178224305, 0.728660484467959, 0.452164494641316, 0.570662775995592, 0.945907333617465, 0.906407906499373, 0.787909625145097, 0.610162203113684, 0.768159911586051, 0.43241478108227, 0.412665067523224, -0.0218286307757877, 0.649661630231775, -1.99679998668039, -0.0415783443348337, -0.318074334161477, -0.140326912130064, -1.99679998668039,
+#> -2.90219869051346, 0.754679214766008, 0.114725581342101, 0.754679214766008, 0.0842515987981054, 0.754679214766008, -0.0376443313778769, 0.449939389326052, 0.206147528974088, 1.05941904020596, 0.815627179853999, 0.693731249678017, 0.0233036337101143, 0.114725581342101, -0.708071947345779, -0.616649999713793, -1.56134345857766, -2.2445621159191, 0.673932595106364, 0.504744495916482, 0.272110859530394, 0.547041520713952, 0.695081107505099, 0.399001933922805, 0.250962347131658, 0.229813834732923, 0.568190033112688,
+#> 0.483595983517746, 0.37785342152407, 0.589338545511423, -1.18713649598234, -2.15996806632416, -1.52523547550672, 0.512545254641823, 0.910732293866251, 0.395431419575815, 0.676504623734235, 1.00442336191906, 0.699927390747436, 0.442276953602218, 0.817041225813444, 1.14495996399827, 0.442276953602218, -1.38469887342751, -0.26040605679383, 0.278317584509807, -1.08020290225589, -1.80630867966514, -1.2675850383615, -3.14013581838069, 0.617356799244748, 0.487788088292147, 0.487788088292147, 1.13563164305515,
+#> -0.16005546647086, 0.74692551019735, 0.228650666386944, 0.228650666386944, 0.0990819554343424, 1.00606293210255, 0.358219377339545, 0.228650666386944, -0.548761599328665, 0.0990819554343424, -0.807899021233868, -1.06703644313907, -1.71276718457922, 0.786947084806669, 0.694365074829414, 0.601783064852158, 0.879529094783924, 0.879529094783924, 1.15727512471569, 0.694365074829414, -0.138873014965883, 0.231455024943138, 0.231455024943138, -0.138873014965883, -0.324037034920393, -0.138873014965883, -2.08309522448824,
+#> -1.62018517460197, 0.927047519898328, 1.01198642878954, 0.825120829228878, 0.689218575002945, 0.910059738120086, 0.910059738120086, 0.706206356781187, -1.12847407526891, -0.6358284036999, 0.0436828674297641, -1.36630302016429, 0.00970730387328088, -1.60413196505967, -1.29835189305132, -2.52538139934905, 0.815070187091492, 0.360768771335578, 0.761622961708443, 0.761622961708443, 1.13575353938978, 0.815070187091492, 0.815070187091492, 0.200427095186432, -0.708175736325395, 0.895241025166065, -1.64350218052875,
+#> -1.02885908862369, 0.440939609410151, 0.146979869803384, 0.547834060176249, 0.467663222101676, -0.173703482494908, -1.10902992669826, -0.975411863240638, -1.40152428951388, 0.934349526342586, 0.953496033029934, 1.04922856646667, 1.06837507315402, 1.08752157984137, 0.896056512967889, 0.972642539717282, 0.130196245473967, -1.19091271595305, 0.647151926032364, 0.819470486218497, -0.980301142392221, -0.405905941771779, 0.551419392595624, -0.635664022019956, -1.40152428951388, -1.11432668920366, -0.463345461833823,
+#> -1.51640332963797, -1.37561629952384, -0.270121018815589, -1.24555803120522, 0.0550246519809534, 0.510228591096113, 0.900403396051965, 0.705315993574039, 1.48566560348574, 0.185082920299571, 0.965432530211273, 0.575257725255422, -0.855383226249366, -1.63573283616107, -0.0252454321505881, 0.713757218075726, 0.617365568046207, 0.23179896792813, 0.842279418115085, -0.121637082180107, 0.585235018036367, 0.713757218075726, 0.842279418115085, -0.764248082376902, -0.0573759821604279, 0.617365568046207,
+#> -2.11373118279017, -2.08160063278033, -2.01262636095285, 0.00161397462786908, -2.03199405648728, 0.853792578142789, 0.311497103178749, 0.718218709401779, 0.388967885316469, 0.505174058523049, 0.756954100470639, 0.679483318332919, 0.0209816701622991, -0.192062980716431, -0.483672673061159, 1.0141523789992, 0.714587368587131, 0.714587368587131, -1.03287519214996, -1.33244020256203, 0.0156023442922954, -0.184107662649086, 0.0655298460276409, -0.833165185208577, -1.43229520603272, 2.56190493279491, -0.03432515744305,
+#> 0.61473236511644, 0.0156023442922954, -0.383817669590468, -0.534633343069438, -1.5694075554619, 0.586372053689061, 0.931296791153214, 0.845065606787176, 1.27622152861737, 1.27622152861737, 1.10375915988529, 0.586372053689061, 0.758834422421137, 0.845065606787176, -0.0172462368732076, 0.155216131858869, -1.22448281799774, -0.0172462368732076, -0.879558080533591, 0.0689849474928307, -1.5694075554619, -1.39694518672982, -1.22448281799774, -0.22042160031561, 1.13918827079002, 0.850786176919131, 1.32458961684988,
+#> 0.624184531734859, -0.920826685430634, -1.7448326679189, -0.94142683499284, -0.0350202542557512, -0.0762205533801643, -1.99689781393025, -0.943432334540515, -0.00203765083054113, 0.580730486704204, 0.535902168432301, 0.311760577072783, 0.670387123248011, 0.625558804976108, 0.64797296411206, 0.625558804976108, 0.580730486704204, 0.603144645840156, 0.580730486704204, 0.0203765083054106, 0.603144645840156, 0.535902168432301, 0.625558804976108, 0.0203765083054106, -0.0916942873743481, 0.244518099664928,
+#> -2.08655445047405, -2.69173674714475, -2.02951363665004, -2.01076524277799, -0.47339694526941, 0.389029172845159, 0.52026792994955, 0.820242231902443, 0.763997050286276, 0.576513111565717, 0.257790415740768, 0.501519536077494, 0.501519536077494, 0.182796840252544, -2.61923361136302, -0.454202360351969, 0.431492242334371, 0.923544799382337, 0.333081730924777, 1.12036582220152, 1.02195531079193, 0.136260708105591, -0.454202360351969, 0.0378501966959976, 0.333081730924777, 0.234671219515184, -1.04466542880953,
+#> -1.80012707876431, 0.165543909488101, 0.775579733428505, 0.758634293874605, -1.61372724367141, 0.792525172982405, 0.809470612536305, 0.521398140120003, 0.690852535659005, -1.49510916679411, -0.495328233114003, 0.589179898335604, 0.301107425919302, -2.08878468897438, -1.5568522534011, -0.89193670893449, -0.379001860345965, 0.760853358739644, 0.779850945724405, 0.703860597785364, 0.798848532709165, 0.399899206029201, 0.684863010800604, 0.475889553968242, 0.722858184770124, 0.798848532709165, 0.741855771754884,
+#> 0.532882314922522, 0.589875075876803, 0.551879901907283, -0.834943947980209, -0.739956013056408, -2.05078951500486, -1.81223185140107, 0.730761186031424, 0.803418129958067, 0.185834106581605, -0.0866294331433047, 0.785253893976406, 0.530954590233157, 0.639940006123121, 0.676268478086442, 0.658104242104782, 0.131341398636623, -1.5216040756945, -1.72141067149276, 0.495724894457385, 0.495724894457385, 0.590962682062498, -1.25030121163636, 1.13064347849147, 1.35286498290341, 0.908421974079543, -0.615382627602271,
+#> -1.25030121163636, -1.12331749482954, 0.463978965255681, 0.273503390045454, -1.47252271604829, -1.23689598068876, -2.01494345241234, 0.743588492789432, -0.152344959498323, 1.26228680727182, 0.437084943322569, 1.02651484614346, 1.21513241504615, 0.154158589968541, -0.0108817828213089, -0.0816133711598159, -0.128767763385487, -1.21331878457593, -0.159166622733478, 0.557083179567175, 0.904355810985673, 0.47026502171255, 0.904355810985673, -0.115757543806166, 0.622196797958143, -1.17927997752532, -2.00405247714425,
+#> 0.214837655423067, 0.840830134155797, 0.551910528586844, -0.65192116128379, -0.0740819501458856, 0.262990923017892, 0.985289936940273, -0.0740819501458856, 0.359297458207543, 0.937136669345447, -2.77066493545611, 0.262990923017892, -0.844534231663092, -1.59938052689136, 0.60530401479273, 0.998997682950603, 0.684042748424304, 1.07773641658218, -1.52064179325978, 0.841520215687454, 0.920258949319028, -1.36316432599664, -0.41829952241774, 0.762781482055879, 1.15647515021375, -0.654515723312464, -0.733254456944039,
+#> 0.0541328793717075, -0.811993190575613, 1.08373658416931, 0.0833643526284086, -1.41719399468294, -0.166728705256817, 1.58392269993976, -0.0416821763142041, 0.708596997341472, 1.20878311311192, 0.958690055226698, -1.66728705256817, -0.541868292084655, 0.333457410513634, -0.917007878912493, -1.16710093679772, -0.0416821763142041, -0.768330924154245, 0.981933297259368, 1.21147614596935, 0.867161872904377, 0.0924547585081874, 0.867161872904377, 0.121147614596935, 0.981933297259368, 1.09670472161436,
+#> 0.69500473637189, 0.809776160726881, -1.82996659943791, -1.60042375072793, -0.624866643710507, -0.96918091677548, -0.0510095219355514, -0.682252355888002, -1.19872376548546, -2.48189125668015, -0.541229109840762, 0.385976138093611, 0.644731091005529, -0.0668450295022454, 0.687856916490849, 0.364413225350952, 0.709419829233509, -0.86467280098066, 0.58004235277755, 0.62316817826287, 0.709419829233509, 0.450664876321591, 0.730982741976169, -2.22313630376823, 0.60160526552021, 0.385976138093611, 0.385976138093611,
+#> 0.450664876321591, -1.53312309600312, -1.23902079329373, -2.55055425387946, -0.255370697854433, 0.0725126672919996, 0.703057600265909, 0.829166586860691, 0.778722992222779, 0.879610181498604, 0.703057600265909, 0.753501194903822, 0.476061424395302, 0.576948613671127, -0.583254063000866, 0.728279397584866, -0.734584846914605, -1.13813360401791, 0.620036208764706, -0.643061426066313, 0.67924391039741, 0.67924391039741, 0.620036208764706, 0.659508009853176, 0.71871571148588, 0.620036208764706, 0.501620805499298,
+#> -1.17593074076065, -1.11672303912795, -2.16272576797238, -0.743239153277222, 0.371619576638611, 0.0929048941596527, 0.836144047436875, 0.836144047436875, 1.02195383575618, 0.371619576638611, 0.464524470798264, 0.371619576638611, 0.464524470798264, -0.185809788319305, 0.185809788319305, -2.97295661310889, -1.11485872991583, 0, -1.81925185012119, 1.02635758130324, 0.85896879121945, 0.607885606093765, 0.942663186261346, 0.85896879121945, -1.06600229474414, -0.647530319534663, 0.0220248408004988, -0.229058344325187,
+#> 0.273108025926184, -1.48447426995361, 1.02635758130324, 0.607885606093765, 0.356802420968079, 0.69158000113566, 0.85896879121945, -1.6518630600374, -1.23339108482793, -0.912820185981558, -0.256115016210653, -1.10983173691283, -0.912820185981558, 1.31997739123952, 1.05729532333116, 0.400590153560252, -1.24117277086701, 1.05729532333116, 0.597601704491524, 0.82773150360848, 0.888191891698143, 0.787424578215372, 0.40450878698084, 0.888191891698143, -0.200095093915789, -1.59068401997804, 0.726964190125709,
+#> 0.323894936194623, -2.01390673660568, 0.0820533838359711, 0.565736488553274, -0.159788168522681, -1.53022363188837, 1.15228282961158, 0.956612160432252, 0.565270822073603, -1.0653180877541, -0.739200305788558, -0.869647418574774, 0.212190497092187, 0.700871641910556, 0.80375188292495, 0.906632123939344, 0.95807224444654, 0.212190497092187, 0.623711461149761, -0.430811009247773, 0.932352184192942, 0.880912063685745, -0.302210707979781, -2.69417631156443, -0.713731672037356, -0.122170286204592, -1.02237239508054,
+#> -0.945212214319741, -1.18640607592552, 0.813575194589115, 0.327093263923392, 1.17393218026743, 1.17393218026743, 0.723485948169537, 1.10186078313177, 0.579343153898212, -0.735959843827632, -1.31253102091293, -0.447674255284981, -0.898120487382873, -1.31253102091293, 1.24402711120327, 0.916651555623462, 0.0982126666739423, 0.0982126666739423, -0.0654751111159616, -1.702352889015, -1.5386651112251, -0.474694555590721, 0.916651555623462, 0.507432111148702, -2.33080297044744, -0.570196434830491, 0.630217112181069,
+#> 0.350120617878372, 0.730251574432032, 0.670230897081454, 0.690237789531647, 0.430148187679142, 0.370127510328564, -0.970334283834344, -1.77112403353223, -0.0786602364462741, -0.0786602364462741, -0.545546801159643, 1.26363863710466, 1.26363863710466, -1.88784567471058, 0.796752072391292, 0.563308790034608, 0.971834534158805, 0.971834534158805, 0.388226328267094, 0.68003043121295, 0.855112892980463, 0.913473713569634, 0.388226328267094, 0.329865507677923, -0.312103518802958, -0.0202994158571031, -0.487185980570472,
+#> -1.01243336587301, -1.77112403353223, -1.42095910999721, -0.58182941200775, 0.404802207542917, 0.820226047353724, -0.166405572196943, -1.62038901153477, -0.322189512125995, -0.607793401995925, -1.04918123179491, 1.31354185712906, 1.85878564688074, 1.13179392721183, 0.716370087401023, -0.166405572196943, 0.898118017318251, 1.20968589717636, 0.664442107424672, -0.945325271842206, -1.07514522178308, -0.270261532149644, 0.223054277625689, -0.607793401995925, -1.82810093144017, -1.73285306402477, -1.55999989055597,
+#> 0.730304657905703, 0.622271424487699, 0.168531844132085, 1.27047082499572, 1.18404423826132, 0.557451484436897, -0.695734023211942, 0.211745137499287, -0.133961209438324, -0.95501378341515, 1.05440435815971, 0.492631544386095, -1.21429354361836, -1.20633553719371, -1.27335417814892, -1.34037281910412, 1.94354058770098, -0.938260973372886, 0.469130486686443, 1.54142874196974, 0.670186409552062, -0.536149127641649, 1.67546602388015, 0.938260973372886, -1.00527961432809, 1.00527961432809, 1.47441010101454,
+#> -1.00527961432809, 0.603167768596855, 0.0670186409552062, -0.737205050507268, -1.00527961432809, 1.0722982552833, 1.00527961432809, -0.737205050507268, 0.201055922865618, -0.268074563820825, -0.469130486686443, -0.670186409552062, -0.469130486686443, -0.737205050507268, -0.268074563820825, -0.728620369402838, 0.314175755614068, 0.0534767243598415, -1.51071746316552, 0.487975109783553, 0.661774463953037, 0.922473495207264, 0.314175755614068, 0.140376401444584, 1.00937317229201, 0.314175755614068,
+#> 0.487975109783553, -2.46661391109768, -1.72555262388997, -1.51333238903381, 0.732665096527219, 0.821090194383952, 0.803405174812605, 0.785720155241259, 0.626554979099139, 0.290539607243552, 0.768035135669912, 0.750350116098565, 0.449704783385672, -0.505286273467047, -1.67249756517593, -0.611396390895127, -1.6623255475426, 0.415581386885649, -0.092351419307922, 1.0620413220411, 0.507932806193571, 0.554108515847532, 0.507932806193571, 0.92351419307922, 0.969689902733181, 0, 0.369405677231688, -0.184702838615844,
+#> -0.230878548269805, 0.369405677231688, 0.277054257923766, -0.969689902733181, -2.81671828889162, -1.78925225288972, -0.74898931516314, -0.49932621010876, -1.1858997490083, 0.0832210350181267, 0.644963021390482, 0.957041902708457, 1.06106819648112, 0.853015608935798, 0.62415776263595, 0.907271672067616, 0.823362153263675, 1.15900022847944, 1.0750907096755, 1.24290974728338, 0.655543115655792, 0.655543115655792, -0.0996425535796804, 0.235995521636085, -1.3582853356388, -1.3582853356388, 0.152086002832144,
+#> -1.10655677922698, -1.3582853356388, -0.351371109991505, -1.27437581683486, 0.947825303247196, 0.64289491078161, 0.922414437208397, 0.871592705130799, 0.337964518316024, 0.64289491078161, -1.74572649686548, -0.602237525119532, -0.780113587391124, -1.2375091760895, -0.98506193511657, 0.553733040450142, 0.810198869711261, 0.874315327026541, 0.297267211189023, 0.617849497765422, -1.94680879484577, 0.810198869711261, 0.104917839243184, 0.361383668504303, -1.49799359363881, -0.139880193180716, -0.246847399730674,
+#> 0.394955839569074, 1.03675907886882, -0.567749019380547, 0.929791872318864, 0.715857459218948, -0.567749019380547, 0.60889025266899, 0.60889025266899, -2.81406035692966, 0.0740542199192002, -0.0329129866307577, -1.54737008880774, -0.496326254900595, 0.642304565165476, 0.642304565165476, 0.992652509801189, 1.08023949596012, -1.98530501960238, 1.43058744059583, 0.905065523642261, 1.08023949596012, 0.37954360668869, 0.291956620529762, 0.116782648211905, -0.145978310264881, -0.583913241059523, -1.10943515801309,
+#> -0.583913241059523, -1.10943515801309, -2.05858884152061, 1.12286664082943, 1.02929442076031, -1.4971555211059, 0.0935722200691188, 0.187144440138238, 0.280716660207356, 0.187144440138238, -2.43287772179709, -0.0935722200691188, 0, -0.0935722200691188, -0.561433320414713, 0, 0.187144440138238, 0.0935722200691188, 0.280716660207356, 0.842149980622069, 1.21643886089854, 1.21643886089854, 0.700859444581404, 0.577331342104162, 0.552625721608714, 0.725565065076853, 0.725565065076853, 0.873798788049543,
+#> 0.404391998636024, 0.849093167554095, -0.781477785145499, 0.676153824085956, -2.83204428626772, -2.06617005090882, -0.0897204112729443, -0.559127200686464, 0.379686378140575, 0.280863896158782, 0.206747034672437, -0.435599098209222, -0.188542893254738, -1.25813812428509, -0.605150086395681, 0.901745385656805, -0.554920237327265, 2.45887070677771, 0.751055838451557, 1.5045035744778, 1.10266478193047, 0.0980678005621458, -0.956759029874595, 0.298987196835811, 0.148297649630562, 0.248757347767394, 0.298987196835811,
+#> 0.148297649630562, 0.148297649630562, -0.504690388258849, -0.504690388258849, -0.705609784532514, -1.35859782242192, -1.65997691683242, 1.33410208785588, 1.01746393409262, -0.37574394246574, -1.19900314225022, -0.122433419455129, 0.637498149576704, 2.09403365688772, -0.502399203971045, -1.00902024999227, 0.0675494728028296, 0.130877103555482, 0.0675494728028296, 0.0675494728028296, -0.37574394246574, -1.83227944977675, -1.13824243794546, 0.534089539500141, 0.644353186364687, 0.956766852480899, -0.329642360938797,
+#> 0.515712265022717, 0.534089539500141, 0.993521401435747, 0.92001230352605, 0.828125931138929, 0.883257754571202, 0.276807696816202, -1.32201518271971, -1.32201518271971, -1.23012881033258, -1.74469249570046, -0.444710321930131, -0.676062512529621, -1.1387668937286, 1.1490492133108, 0.840579625844814, 1.2518724091328, 0.352169445690335, 0.71205063106732, -0.419004522974632, -1.62717707388308, -1.76204438333889, -0.428225925831363, 1.70120354141749, 0.460986379173653, -0.70902981162242, 0.390785407725889,
+#> 0.718389941148789, 0.835391560228396, -0.662229163990577, -0.54522754491097, 0.489693049718263, 0.296197315787034, 0.586440916683877, 0.644489636863246, 0.528392196504509, 0.567091343290754, 0.547741769897632, 0.625140063470123, 0.412294756145772, -0.322989032792897, -2.19989765192581, -2.12249935835332, -0.0520950052891769, -1.566735142238, 0.238649678939528, 1.29348125985224, -0.410477447775989, 0.380646237908548, 0.887776805655046, 1.13119947817336, 0.928347251074765, -1.20160113346053, -0.491618338615428,
+#> 0.157508788100089, 1.5166187096607, 0.786350692105746, -0.978463683652066, -0.552474006745008, -0.593044452164728, -1.52616469681828, 0.413037060265546, 0.944084709178392, 0.983421572060825, 1.21944274935542, 1.00309000350204, -0.904747846295959, 1.18010588647299, -0.885079414854742, -0.137679020088515, -0.590052943236495, -0.78673725764866, -0.708063531883794, -1.73082196682705, -1.86724822121664, -0.931758106389916, 0.600853358326208, 0.839701898281967, 0.939222123263534, 0.97903021325616, 1.01883830324879,
+#> 0.919318078267221, 0.00373200843680874, 0.859605943278281, 0.760085718296714, -0.135596306537384, -1.27012687132724, -0.394348891489457, -0.991470241378856, -1.32983900631618, -2.09501112351988, -1.46359804879236, -0.628503337055963, 0.878740776809726, 0.939845267912389, 0.695427303501737, 0.939845267912389, 0.960213431613277, 0.145486883577769, -0.343349045243535, 0.878740776809726, 0.451009339091085, -0.465558027448862, -0.893289465167503, -2.28476001694313, 0.920478855746871, 0.205464030300641,
+#> 0.353398132117102, 0.673922019386102, 0.624610652113948, 0.106841295756333, 0.304086764844948, -0.90404173332282, -1.77798634825302, 0.0489354040803585, 0.744905595445456, 1.70186460857247, 0.570913047604182, 0.918898143286731, 0.831901869366094, 0.396920499762907, 1.00589441720737, -1.08201615688793, -0.386045965522828, -0.734031061205377, 0.483916773683545, -1.43000125257047, -0.212053417681553, -1.08201615688793, 1.12089707663561, -0.800640769025436, -0.320256307610174, -1.91198655544354, -0.0343882474000637,
+#> 0.563967257361044, 0.563967257361044, 0.502068412040929, 0.729030844881349, 0.398903669840738, 0.522701360480967, 0.852828535521578, -1.97388540076365, 0.543334308921005, -0.7565414428014, -2.00501987881228, -1.67971244137628, -0.256492402593771, 0.841420198752736, 0.739761624553985, 0.333127327758983, 0.638103050355235, 0.861751913592486, 0.556776190996234, 0.699098194874485, 0.719429909714235, -0.398814406472022, -1.04942928134403, 0.687432588927141, -0.0835198472528302, 0.918718319781132, -0.109218261792163,
+#> 0.533242101691147, 0.867321490702468, -1.98520252316343, -0.828773868893469, -1.35539283996118, 0.0363863849654006, -1.35539283996118, 1.66012881404641, 0.345670657171307, -0.891466431652318, 0.113707453016877, 0.654954929377213, -1.43271390801265, 0.577633861325736, -0.427540023343459, 1.19620240573755, 1.42816560989198, 0.732275997428689, 0.422991725222783, -0.814145363600841, -0.891466431652318, -0.766326515392226, 1.45337787401974, 0.898451776666748, 0.343525679313757, -0.3038881009314, -1.50622797852955,
+#> -0.118912735147069, -1.49631638214254, -0.338944594849968, 1.14910484595477, 0.818427192442606, 1.39711308608889, -1.24830814200842, -0.586952834984091, -0.256275181471927, 0.818427192442606, -0.256275181471927, -0.717272978614888, -0.59198512208827, -0.779916906878197, 1.4596035285351, 0.629571479046256, -0.796457020801491, 1.44269261063331, 1.10256861598498, 1.0175376173229, 0.677413622674578, -0.626395023477329, -0.0595216990634564, -0.938175351904959, -0.342958361270393, -1.47670501009814, -1.41857068714651,
+#> -1.3657702893619, -0.996167504869632, 0.323842439745605, 0.693445224237871, 1.06304800873014, 0.535044030884043, 0.376642837530214, 0.746245622022481, -1.26016949379268, 0.957447213160919, 1.48545119100701, 0.482243633099433, -1.10176830043885, -0.520963924808147, 0.0815689159676396, 0.872010554035006, 0.679740966396998, 0.102932203482974, 0.936100416581008, 1.02155356664235, 0.829283979004337, 0.807920691489003, 0.914737129065674, 0.850647266519671, 0.316565078636316, 0.679740966396998, 0.743830828943,
+#> -0.837052447191732, -0.00388423409369724, -2.09748641059645, -0.367060121854379, -1.79840038538177, -0.260243684277708, -0.666146147069058, -2.07612312308112, -0.730236009615061, -0.513066645566801, 0.222863324168079, 0.986049959448696, -0.185986659017966, 1.0678199560859, 0.304633320805288, 0.604456641808388, 0.822509966174278, 0.849766631720015, -1.19448328421021, 0.740739969537069, 0.549943310716915, 0.795253300628542, -0.59483664220401, -1.24899661530168, -0.676606638841219, -2.53005989595129,
+#> 1.5402052275126, 0.28347335475692, -1.17168986632861, 0.944911182523067, -0.576395821339072, -0.973258517998761, -0.0472455591261539, -2.16024370144395, 0.586820992262699, 0.679627231914951, 0.586820992262699, 0.586820992262699, 0.64250473605405, -0.137067677024864, 0.586820992262699, -0.0257001894421621, 0.6239434881236, 0.661065983984501, -0.693905114938374, -1.93750872627855, -1.61611142669612, 0.989711648906924, 0.689039755568112, -0.0125279955557838, 1.08993561335319, 0.0876959688904869, -1.3154395333573,
+#> 0.0876959688904869, -1.83061008215625, -0.0164919827221286, 0.80810715338429, 0.80810715338429, 0.478267498941723, -0.0164919827221286, -0.841091118828548, 1.63270628949071, -0.181411809943412, -0.841091118828548, 1.16224974847522, -1.01696852991582, 1.07144898687559, 0.254242132478954, 0.617445178877459, 0.799046702076712, -1.6525738611132, -0.65376548351731, -1.01696852991582, 0.435843655678206, -1.11534276041703, 0.567689428954776, 1.04855576877529, -1.05523446793947, 0.928339183820164, 0.868230891342599,
+#> 0.74801430638747, -0.814801298029209, -1.1754510528946, -0.656253932944839, 0.34889449599599, -0.747631062848551, 0.714403015610837, 0.805780145514549, 0.440271625899702, 0.988534405321972, -1.66140236188567, -1.38727097217453, 1.35404292493682, -0.19936828342628, -1.19795624902243, -0.501470057730319, 0.752205086595478, 0.752205086595478, 0.831803508457433, 0.811903902991945, 0.7124058756645, 0.0557188953033687, -2.07353888950394, -0.14327715935152, -1.75496272491868, 0.783371617773767, 0.640366866072784,
+#> 0.783371617773767, 0.854873993624259, 0.247103798895081, 0.872749587586882, 0.962127557399996, 0.962127557399996, 0.854873993624259, 0.139850235119344, -0.164034862245245, -1.02206337245114, -0.986312184525898, -0.00315451658163926, -1.75496272491868, -1.41532643962885, -1.19518831291265, 1.53179236838601, 0.961028969974664, 0.390265571563315, 0.897610814595625, 0.897610814595625, 0.707356348458509, -0.180497826848033, -1.19518831291265, 0.326847416184277, -0.814679380638421, -0.941515691396498,
+#> -1.38544277904977, 0.578191533113318, 1.01621542183553, -0.122646688842219, 0.140167644391108, -1.61192791049774, -0.712832435640251, 1.85336433266465, 0.386966179347565, -0.224033051201222, -0.590632589530494, -0.712832435640251, 0.0960563769138125, 0.802886320241866, 0.614398335354385, 0.190300369357553, 0.54371534102158, 0.0489343806919423, 0.59083733724345, 0.661520331576256, 0.54371534102158, 0.308105359912229, -0.351602587193955, -1.27048151352042, -2.77838539262027, -0.334637610265653, 0.746499284438764,
+#> 0.978171476161139, 0.617792511259667, 0.900947412253681, 1.02965418543278, 0.334637610265653, 0.95243012152532, -1.77615346987154, -0.797981993710403, -0.180189482450736, -0.900947412253681, -1.57022263278499, 0.800741140014823, 0.917448350705242, 0.956350754268715, 0.722936332887876, 0.820192341796559, 0.411717104380091, 0.489521911507037, -1.57230547735704, -0.716452598960631, -0.0551117383815869, -1.66956148626572, -1.10547663459536, -2.13053169361457, -0.200633029443525, 0.391712105104024, -0.238848844575625,
+#> 0.773870256425024, 0.773870256425024, 0.735654441292924, 0.773870256425024, 0.697438626160824, 0.773870256425024, 0.754762348858974, -1.27067585314232, -0.238848844575625, -1.59551028176517, 1.21707101777625, -0.236768081956472, 0.739381027864071, 0.635535377883162, 0.344767557936617, 0.240921907955708, -1.6906071816892, 0.573227987894617, -0.0498459119908364, -1.77368370167392, 0.12673722234847, -0.0354864222575716, 0.532296333863574, 0.207849044651491, 0.937855445378677, 1.4245263791968, 0.694519978469615,
+#> 0.532296333863574, 0.0456254000454492, -0.116598244560592, -0.0354864222575716, 0.0456254000454492, 0.694519978469615, -0.603269178378717, -1.90105833522705, -2.54995291365121, 0.00865007652599267, 1.04665925964513, 1.35806201458087, 0.320052831461733, 0.735256504709387, -2.58637288127184, 0.112450994837906, 0.00865007652599267, 0.00865007652599267, 0.00865007652599267, -0.198951760097834, -0.821757269969315, -1.13395852475366, 1.49288104911047, 0.126214514059538, 0.711928743367081, 0.729677659406703,
+#> 0.694179827327458, -0.21101489069329, -1.20495418891215, -1.20495418891215, -4.01377259877264, 0.078473468621913, 0.621974899447752, 0.270297503031033, 0.590004227046232, 0.366209520235593, 0.558033554644712, 0.621974899447752, 0.270297503031033, 0.462121537440153, 0.526062882243193, 0.621974899447752, 0.494092209841673, 0.526062882243193, 0.590004227046232, -0.113350565787207, -0.0813798933856868, -0.720793341416086, -0.688822669014566, -0.465027962203926, -0.0813798933856868, -0.433057289802406,
+#> -2.02137871587882, -1.14055447097073, 1.42851624334453, 1.06150614129949, 0.694496039254454, 0.621094018845447, 0.621094018845447, 0.841300080072469, 0.180681896391403, -0.479936287289664, -0.626740328107678, -0.846946389334701, -0.333132246471649, -1.54809455602263, -0.0517180809361679, 1.3239828719659, 1.25157755865527, 1.01022651428648, -1.59636476489639, 0.406848903364522, 1.68600943851908, 0.503389321112036, 0.28617338118013, -0.679230796295007, 0.768875469917698, -1.33087861609072, 0.937821200975847,
+#> 0.768875469917698, -0.413744647489344, -0.317204229741831, -1.3550137205276, -0.389609543052466, -0.727501005168764, -0.534420169673736, 0.613582453540572, 0.893189647559061, -1.31260043858679, -1.40580283659296, 0.271840327517975, 0.908723380560088, 0.784453516551871, 1.00192577856625, 0.256306594516948, 0.535913788535437, -1.2038643075796, -1.34366790458885, -0.184343878739049, 1.06759150643658, 1.03232572093868, 0.626769187712767, 0.961794149942865, 0.838363900700198, -0.413571484475432, -1.52444372765944,
+#> -0.00801495124952385, -0.766229339454483, -1.63024108415316, -1.97978329677341, -0.0666874373649992, 0.287589573636559, 0.712721986838428, 0.571011182437805, 1.27956520444092, 0.78357738903874, 0.571011182437805, 0.78357738903874, 0.712721986838428, 0.641866584638117, 0.429300378037182, -0.846096861568427, -0.208398241765622, -1.55465088357154, -0.208398241765622, -1.9089278945731, -2.3134995468388, 0.615460316007593, 0.438712738077207, 0.489212046057317, 0.817457547928034, 0.489212046057317, 0.514461700047372,
+#> 0.413463084087152, 0.665959623987703, 0.691209277977758, 0.388213430097097, 0.463962392067262, 0.312464468126932, -0.647022383495162, -1.42976165718687, -1.90950508299792, 0.0795020742361756, 0.858622401750696, 1.01762655022305, 0.842721986903461, -0.159004148472351, -1.35153526201498, -1.28793360262604, 0.995571117953471, 1.14318462802894, 0.864359108997495, -1.3826465443736, 1.14318462802894, -0.480563982801264, -0.496965483920761, 0.208299064217613, -1.33344204101511, -0.660980495115731, -1.47377375197453,
+#> -1.34335129604758, 1.26509782249141, 1.06946413860098, 0.74340799878361, -0.169549192705034, -0.886872700303255, 0.808619226747085, 0.352140631002763, -0.365182876595458, -3.00271887854749, 0.452464488548252, -0.238572184870897, 0.682810046354635, -0.0466175533655778, 0.414073562247188, 0.83637375155889, -0.315354037473025, 0.682810046354635, 0.490855414849316, 0.260509857042933, 0.222118930741869, 0.606028193752507, -1.04478163719324, -1.60580330678069, 0.0473561296905835, -1.34749714483206, -1.50248084200124,
+#> -1.19251344766288, -1.53692166359439, 1.01169913429883, 0.546748042791282, -0.589799069782722, -0.899766464121087, 0.822274615536495, 0.908376669519374, 0.3917643456221, 0.736172561553616, 0.891156258722799, 1.01169913429883, 0.942817491112526, 0.908376669519374, 0.581188864384434, -0.124847978275175, -1.35681722087784, -1.00980983962492, 0.774799549675846, 0.576509617531317, 0.824372032711978, 0.824372032711978, 0.79132371068789, 0.0642606261579493, -1.4890105089742, 0.488128163328181, 1.05973667762935,
+#> 1.05973667762935, 0.665523909145785, 0.783787739690855, 0.0347834795720794, 0.980894123932638, 1.02031540078099, 0.921762208660103, -0.379139927335665, -1.30553993327205, -0.241165458366417, -1.18727610272698, -1.71946334017979, -1.30553993327205, -1.22669737957533, 0.350153694358932, -1.52712102787335, -0.197047874564303, -0.446436590809748, -1.41628159843093, 0.745087275696269, 1.16073513610535, 1.02218584930232, 0.689667560975059, -0.0307887304006724, 1.14114170048692, 0.504225402540733, 0.78287628289219,
+#> -0.0530763581621825, -1.12787261094638, -1.24729441681129, -1.37263330039711, -0.971539154177173, -1.85394627586103, 1.43502572314243, 0.873493918434523, 0.873493918434523, 0.311962113726615, 0.953712747678509, 0.0713056259946549, 0.392180942970602, 0.0713056259946549, 0.311962113726615, -1.69350861737305, -0.570445007957239, 0.793275089190536, 0.151524455238642, 1.11415040616648, -0.891320324933186, -1.46437294365453, 0.65279275801467, 1.28794246851543, 0.72336494807031, 0.72336494807031, -0.12350133259737,
+#> -1.11151199337633, -0.68807885304249, -1.07331146278805, -0.169198317238549, -1.12755825152102, 0.0297065747823406, 1.16888913817471, -1.14564051443201, -0.838242044945179, -0.368103209259439, 0.96998424615382, 1.25930045272966, -1.38070993227488, 1.11464234944174, 0.51792767337907, 1.04231329779778, -1.82821178645203, 1.15189036864942, 0.680219523957101, 0.294307014663387, -0.00584715923172279, -1.50661802870727, -0.584715923172292, 0.315746598513038, 0.937494530152909, 1.08757161710046, 1.28052787174732,
+#> 0.851736194754306, 1.00181328170186, 0.744538275506053, 0.401504933911641, 0.272867430813737, -0.22024299772823, -0.070165910780675, -1.09926593556391, -1.39942010945902, -0.456078420074388, -1.84965137030169, -1.67389150676928, 0.228694706435757, 0.643804425680492, 0.816766808699132, 0.540026995869308, 0.695693140586084, 0.76487809379354, -0.428562349035074, -1.58741031525996, -2.1118875131513, 0.589971048173292, 0.965881804531496, -0.890177554987135, 0.61346547044568, 0.918892959986721, 0.965881804531496,
+#> 1.01287064907627, -0.443783531811768, -1.26608831134534, 1.10684833816582, 0.871904115441945, 0.82491527089717, -0.396794687266993, -1.36006600043489, -0.467277954084156, -0.185344886815503, -0.749211021352809, -2.81635353525414, 0.266812440181971, 0.503979053677057, -0.326104093555743, 1.21547889416231, 0.266812440181971, 0.741145667172143, 0.6225623604246, 0.0296458266868857, -0.326104093555743, -0.2075207868082, 0.0296458266868857, 0.0597919757638675, 0.405256724621768, 0.923453847908619, -0.803869896380884,
+#> -0.544771334737458, 0.750721473479668, 1.44165097119547, 1.26891859676652, 0.318890537407293, -0.976602270809834, -1.84026414295458, -1.14933464523878, 0.146158162978343, 0.440260279748299, 0.670872807235504, 0.733767132913832, 0.712802357687722, 0.607978481557175, 0.628943256783285, 0.39833072929608, -0.0628943256783284, -0.314471628391642, -1.94972409602818, -1.86586499512374, -1.25634279603604, -0.943560357188895, -1.19378630826661, -1.13122982049718, 1.05824725143285, 1.30847320251057, -0.755890893880606,
+#> 0.93313427589399, 0.119899934891407, 0.93313427589399, 0.808021300355131, 0.119899934891407, -1.40116690997546, 0.690897969434903, 0.749010882751858, 0.574672142800994, 0.690897969434903, 0.51655922948404, 0.749010882751858, -1.11060234339069, -1.45927982329241, -1.03466843522579, 1.08158035420328, -0.450875665728114, 0.187647675909967, 1.20928502253089, -1.38129539211503, 0.388326440424792, -0.907004209081959, -0.537723923955733, -1.64556477933441, 0.686731758304912, 1.19206267479343, 0.803346585186878,
+#> -0.80982518668032, 0.958833021029499, 0.259144059737702, -0.78196888088344, -2.21605941150731, 0.470335526140224, 0.732915482451638, 0.611724733384831, 0.672320107918234, 0.793510856985041, 0.712717024273836, 0.77331239880724, -1.75149487341789, -0.499190466394225, 0.530930900673627, 0.793510856985041, 0.753113940629438, 0.732915482451638, 0.712717024273836, 0.0865648207620045, -0.256808968260613, 0.0865648207620045, -0.822365797239042, -2.13526557879611, -1.83547070951838, 0.874328952844905, 1.03141878834423,
+#> 0.206697151972791, -1.344564973583, 1.1295999355313, -0.0485738307136058, 0.776147805657829, 1.22778108271838, 1.03141878834423, -0.382389731149663, -1.08929399089661, 0.776147805657829, -1.344564973583, -0.460934648899323, 0.658330429033338, 0.147788463660545, -1.44274612077008, 0.0888797753483, -1.65619893776339, -0.440918186426193, 0.799164212897475, 0.352734549140955, 0.749560916924528, 1.04718069276221, 0.972775748802789, -1.03615773810155, -0.78814125823682, -2.0043483028244, -1.04580037136945,
+#> 0.834428263407584, 0.705392964942493, 0.686959350876052, 0.779127421208259, 0.742260193075376, -0.234721352446021, 0.557924052410962, 0.742260193075376, 0.779127421208259, 0.447322368012313, -0.529659177509085, -0.511225563442643, -1.94904746062508, -1.25468055745955, 0.25686373617282, -0.666857776602515, 1.34853461490731, 1.09661056596858, 1.18058524894816, 1.26455993192773, 1.18058524894816, -0.246984361704635, -1.50660460639827, 0.592762468091124, 0.0889143702136686, -1.59057928937785, -0.330959044684211,
+#> 0.00493968723409268, -1.00275650852082, -0.414933727663787, 0.683445228140004, -0.29334390690953, -1.6940226666032, 0.886175048621983, 0.720305195500364, 0.757165162860724, -0.698803547873487, 0.609725293419284, 0.867745064941803, 0.738735179180544, -0.956823319396006, -1.62030273188248, -1.85903525368917, 1.49996925453425, 1.03665828788275, 0.399605708736925, 0.631261192062678, 0.370648773321206, -0.121619128746021, 0.515433450399801, 0.862916675388432, 0.544390385815521, -0.208489934993178, 0.110036354579733,
+#> -1.22198267454335, -0.845542514139, -1.71425057661058, 0.301188109785199, 0.258567150853332, 0.535603383910472, 0.57822434284234, 0.556913863376406, 0.365119548183001, 0.514292904444538, 0.535603383910472, 0.386430027648935, 0.407740507114869, 0.556913863376406, 0.19463571245553, -0.444678671522487, -2.1495170287972, -2.59703709758181, 0.474130282516868, 0.474130282516868, 0.474130282516868, 0.686671443645119, 0.403283228807451, 0.261589121388617, -0.517728469414971, -1.86382248989389, 0.970059658482787,
+#> 0.544977336226285, 0.828365551063953, -0.588575523124388, -2.14721070473156, -1.8289404822185, 0.591846920036642, 0.556247105297596, 0.591846920036642, 0.235848772646181, 0.556247105297596, 0.698646364253781, 0.200248957907135, 0.663046549514735, 0.485047475819504, 0.164649143168088, 0.200248957907135, 0.342648216863319, 0.413847846341411, -1.15254400217662, -2.71893585069465, -0.445083301459734, 0.390238913602136, 0.552662677641945, 0.343832123876477, 0.204611754699498, 0.645476257093264, 0.413442308464966,
+#> 0.320628729013647, 0.436645703327796, 0.0189845957968606, -2.88143976205686, -2.77042343766666, 0.572317821675197, 0.754649163093844, 0.663483492384521, 0.0253237974192568, 0.481152150965874, -0.126618987096282, 0.511540707868982, 0.298820809547227, 0.207655138837904, 0.450763594062766, -1.06866425109262, -2.36600213895952, -0.646572300681943, 0.303638925734614, 0.100022234359638, 0.891864923040101, 0.665624154845683, 0.688248231665125, 0.575127847567916, 0.891864923040101, 0.801368615762334, 0.643000078026241,
+#> 0.50725561710959, 0.235766695276288, 0.439383386651265, 0.190518541637405, 0.167894464817963, -0.578700070223617, -1.07642976025134, -2.43387436941785, -3.20770207164045, 0.228611283502215, 0.414357951347764, 0.692977953116088, -0.142882052188884, 0.13573794957944, 0.414357951347764, 0.0428646156566651, -0.0500087182661096, 0.600104619193313, 0.414357951347764, 0.507231285270539, -0.0500087182661096, -1.65096842898161, 0.473861139579732, -0.588553644700941, -0.88735780277988, 0.905467145693755, 0.341059291544647,
+#> 1.10466991774638, 0.839066221676213, 0.971868069711297, -0.0573462525606047, -1.45176565692899, 0.963520440822876, 1.92017494026222, 1.06422091444807, 0.25861712544652, -0.0938345322416577, -0.924613439649506, -0.0686594138353593, -0.0938345322416577, -1.25188997893139, -0.597336900367626, -1.17636462371249, -1.31693824542019, 0.771787064757877, 0.771787064757877, 0.0306264708237252, 0.56965235732129, 1.24343471544325, 1.17605647963105, 0.0980047066359209, -1.1148035379836, -0.912668830547014, -1.31693824542019,
+#> 0.299599567509612, 0.534999227695735, 0.652699057788797, 0.534999227695735, 0.476149312649204, 0.50557427017247, 0.446724355125939, -0.494874285618555, -2.73117105738673, 0.387874440079408, -0.612574115711616, -0.139035445187863, -0.486624058157522, 0.0695177225939317, 1.39035445187863, 0.903730393721112, 0.764694948533249, 1.39035445187863, 1.3208367292847, -0.486624058157522, -1.11228356150291, -0.41710633556359, -0.41710633556359, -1.25131900669077, -1.5293898970665, -3.02169289010164, -1.10867868629628,
+#> 0.517383386938266, 0.134780546177195, 0.421732676747998, 0.517383386938266, 0.613034097128533, 1.56954119903121, 0.230431256367463, 0.517383386938266, 0.421732676747998, 0.32608196655773, 0.32608196655773, 0.517383386938266, 0.421732676747998, 0.421732676747998, 0.32608196655773, 0.0391298359869274, -0.247822294583875, 0.32608196655773, -1.39563081686709, -1.87388436781843, 0.257362118593372, 0.574657881242735, 1.08233110148172, 0.828494491362225, 0.786188389675643, 0.0246785593171728, 0.680423135459189,
+#> -1.75217771151926, 0.0669846610037545, 0.384280423653117, -1.2021983895937, -1.73102466067597, 0.740986951435983, 0.509428529112239, 1.03043497934066, 0.33575971236943, 0.856766162597856, 0.625207740274111, -0.127357132278059, -0.822032399249293, -1.92193490528708, -1.22725963831585, 0.526818217300821, 0.753677736712657, 0.879710803052567, 0.904917416320548, 0.0478925652091657, 0.753677736712657, 0.325165311156966, -1.26285132472589, -1.48971084413773, -1.43929761760176, -1.82096747973793, -0.741342491751014,
+#> -0.660370617651995, 0.770132491430664, 0.905085614929029, 0.878094990229356, 0.581198118532955, 0.257310622136881, 0.338282496235899, -1.5510612327412, 1.36392623482347, 1.20198248662543, 0.0413856245394983, -0.606389368252649, -0.957267489348396, -1.8286332989375, -1.8286332989375, 0.711135171809028, 0.304772216489583, 0.558749063564236, 0.253976847074653, 1.57465645186285, 0.761930541223958, 0.660339802394097, 0.507953694149306, -0.0507953694149306, 0.406362955319444, 0.101590738829861, -0.812725910638889,
+#> -1.32067960478819, -1.69705149043156, -0.714547995971185, 0.872573033541736, 1.02372741730487, 0.645841457897033, 0.796995841660168, 0.494687074133897, 0.267955498489194, 0.41910988225233, -0.336662036563347, -1.77262868231313, -1.05081146847584, -0.553674317341631, 0.148166366612549, -0.729134488330176, -0.0565371662074202, 0.206653090275397, 0.937737136061002, 1.49336101085806, 1.28865747803809, 0.908493774229578, -1.31400172495866, -0.992324744812994, 1.1716840307124, 0.0604362811182765, -1.51870525777863,
+#> -1.01329569431206, 0.179275392070595, 1.51214895920415, 1.23154399770235, 0.950939036200549, 1.09124151695145, 1.3016952380778, -0.311783290557557, -0.87299321356116, -0.732690732810259, -1.22374941543841, -1.08344693468751, -1.22374941543841, 0.249426632446046, 0.600182834323298, 0.810636555449649, -0.171480809806656, -1.29390065581386, -1.84153550760176, 0.586528473813402, 0.447213327338762, 0.924865258108957, 0.96466958567314, 0.865158766762683, 0.944767421891049, 0.924865258108957, 0.148680870607389,
+#> -1.18476410279274, -0.149851586123983, 0.646234965159676, 0.128778706825298, -1.78182901625548, 0.56662631003131, -1.14495977522856, -1.0454489563181, -0.846697308043048, -0.796148215025553, -0.189559098815608, 1.02361913360428, 0.973070040586787, 1.22581550567426, 0.0631863662718693, -1.45328642425299, -1.70433616253571, -1.19628682950638, 0.876554449253262, 0.104319463048688, 0.490436956150975, 1.20170602239203, 1.38460378228259, -1.01338906961583, 0.409149062866283, 1.05945220914382, -0.62727157651354,
+#> -0.62727157651354, -1.29789669611225, 0.632690769399186, 0.307539196260418, -1.34187047737298, 0.534871449022798, 0.910219834301954, 1.00405693062174, 0.722545641662376, 0.534871449022798, 0.816382737982165, -0.966522092093828, -1.43570757369277, -0.77884789945425, 0.274100578794734, 0.62357881675802, 1.3636503795038, 1.24030511904617, 1.01417214154052, -0.0753776591685519, -1.06213974282959, 0.808596707444465, -1.22660009010643, 0.109640231517893, -0.301510636674207, 0.973057054721305, 1.13751740199815,
+#> -1.30883026374485, 0.109640231517893, 0.87026933767328, 0.212427948565919, -1.65830850170814, -0.301510636674207, -1.69942358852735, -1.1032548296488, -2.12527929692989, -1.62216885450031, 0.353005475038039, 0.762947317017697, 0.707046156747744, 0.800214757197666, 0.707046156747744, 0.48344151566793, 0.725679876837728, 0.65114499647779, 0.707046156747744, 0.65114499647779, 0.48344151566793, 0.166668274138194, -0.261907287931448, -0.112837527211573, -1.13769213216072, -1.93894209603005, -1.74560715022605,
+#> -1.79995518603738, 0.464546306101669, 0.537010353850118, 0.446430294164556, 0.663822437409905, 0.645706425472793, 0.518894341913006, 0.808750532906805, 0.70005446128413, 0.62759041353568, 0.464546306101669, -0.712994469810639, -1.61879506666626, -2.09257673701478, 0.461997461418847, 0.24458689133939, 1.16858181417708, 0.353292176379119, 1.22293445669695, -0.570702746458576, 0.0815289637797966, 0.135881606299661, -1.00552388661749, 0.092598546908704, 0.162047457090232, 0.162047457090232, -0.462992734543519,
+#> 1.34267893017621, 0.995434379268567, -0.254646003998935, 0.092598546908704, -1.85197093817408, 1.62047457090232, -0.949135105814214, -0.949135105814214, 0.671561567249512, 0.155955055901546, -1.40996101559969, -1.79189176474633, -0.245072230702429, 0.767044254536173, 0.747947717078841, 0.900720016737498, 0.900720016737498, 0.824333866908169, 0.19414813081621, 0.423306580304195, 0.690658104706844, 0.747947717078841, 0.633368492334848, -1.06622334136771, -1.37176794068502, -1.772795227289, -0.23467159516958,
+#> -0.179203763584043, -0.512010753097266, 0.320006720685791, 0.597345878613477, 1.42936335239653, -0.789349911024952, 1.76217034190976, 0.597345878613477, 0.320006720685791, -0.456542921511729, -0.844817742610489, -2.00964220590677, 0.149195472266184, 0.462944774237718, -0.0504631744429741, 0.719648748578064, 0.00658215318821387, 0.719648748578064, 0.776694076209252, 0.462944774237718, 0.69112608476247, 0.177718136081778, -0.0219405106273801, -1.3339830461447, -2.7601162369244, 0.921191756647779, 1.40433428635815,
+#> 0.785911848328875, -1.33991528239677, -1.39789238596201, 0.515352031691065, -0.721492844367491, -0.00644190039613822, -0.161047509903458, -1.46527548292401, 1.17011207629183, 0.390037358763944, -0.917114870607111, 0.727366966343571, 1.50744168387146, 0.558702162553757, 1.27552757866046, 0.938197971080838, 0.263538755921584, -1.10686277487065, -0.368954258290217, -0.390037358763944, -1.1490289758181, -0.03162465071059, -1.40202618150282, -0.741908589336647, -1.58407509615122, -0.0401031669911702,
+#> 1.36350767769978, 0.87224388205795, 1.22314659323069, 0.87224388205795, -0.0401031669911702, -0.531366962633004, 0.591521713119759, 0.802063339823402, -0.0401031669911702, -1.30335292721303, -1.44371401168212, -0.604335083384171, -1.05845971251678, -1.24010956416983, 0.894276192753455, 1.84793791393194, 1.12133850731976, 0.39473910070758, 0.667213878187148, -1.10387217543005, -0.0139730655117727, 0.530976489447364, -1.14928463834331, -0.286447842991341, -0.0836775851277005, 0.088599796017565, -0.305177075171613,
+#> 0.531598776105391, 0.802320375047951, 0.925375647294569, 0.334710340510801, 0.285488231612154, 0.72848721169998, 0.482376667206743, 0.703876157250656, -0.0344554762290532, 0.0393776871189177, -1.73261823323238, -2.76628252010398, -2.17666286367742, -1.81872954667073, 0.741870336530955, 0.90707032899558, 0.852003664840705, 0.68680367237608, 0.934603661073018, 0.824470332763268, 0.79693700068583, 0.879536996918143, 0.549137011988893, -0.359462946566545, 0.191203694982205, -0.497129606953733, -0.937662920192733,
+#> -1.07532958057992, 0.273803691214517, -0.772462927728108, 0.760071762838393, 0.760071762838393, 0.366931195853017, 0.602815536044243, 0.524187422647167, 0.131046855661792, 0.288303082455942, -1.52014352567679, -1.91328409266216, -0.975205564978018, -1.08177616444656, -1.26446862067835, -1.26446862067835, 0.669026541108076, 1.0496358249243, 1.09530893898225, 0.988738339513706, 1.00396271086635, 1.0496358249243, 1.019187082219, 0.288417257291851, 0.562455941639533, 0.729924026518672, -0.762064366040932,
+#> -0.883859336862124, -0.975205564978018, -1.2492442493257, 0.420953355009535, 0.51756560042156, 0.558970848455284, -1.49748980388638, -1.61834981742809, 0.231192831061156, 0.75388966650377, 0.653371044303267, 0.492541248782463, 0.613163595423066, 0.794097115383971, 0.874512013144373, 0.432230075462161, 0.613163595423066, 0.190985382180955, -0.412126351022061, -1.7791796129489, -1.8394907862692, -0.243227999984916, 1.72130584604711, 0.69226430764938, -0.710974153802065, 0.69226430764938, -1.27226953838264,
+#> 0.69226430764938, 0.411616615359091, -0.617424923038635, -1.36581876914607, -0.219268791861828, -2.31858387566813, 0.504632961174829, 0.528763019609384, 0.528763019609384, 0.528763019609384, 0.528763019609384, 0.504632961174829, 0.55289307804394, 0.577023136478495, 0.770063603954937, 0.64941331178216, 0.64941331178216, 0.64941331178216, 0.528763019609384, 0.263332376829277, 0.432242785871163, -0.315789025600049, 0.215072259960166, 0.142682084656501, -1.4740318304587, -2.68053475218646, -1.54642200576237,
+#> -0.541246301391837, 1.77408509900658, 1.42327731106742, 0.932146407952609, 0.370853947249963, 0.861984850364778, -0.82189253174316, 0.0902077168986395, 0.441015504837793, -1.38318499244581, -0.190438513452684, -1.10253876209448, -1.03237720450665, -0.82189253174316, -2.42160565774686, 1.0184322859683, 0.475268400118542, -0.611059371580983, 0.927904971660011, 0.565795714426836, 0.203686457193661, 0.746850343043423, 0.565795714426836, -0.0678954857312203, -0.248950114347808, -1.15422325743074, 0.188573618717447,
+#> 0.481055149789406, 0.407934767021416, 0.261694001485437, -0.688870974498429, -1.71255633325028, -0.323269060658481, 1.50474050854126, 0.188573618717447, 0.188573618717447, 0.700416298093375, 0.919777446397344, 0.992897829165334, -1.71255633325028, -0.177028295122501, 1.79722203961322, -0.761991357266419, -1.20071365387436, -1.05447288833838, -1.4785684717526, -1.51626902242677, -1.06386241433673, 1.08506897409095, 0.161405482573789, -0.856509385628795, 1.08506897409095, 1.00966787274261, 1.19817062611346,
+#> 0.387608786618808, 1.02851814807969, -0.159049198156654, -0.234450299504993, 0.745764018023421, 0.0106032798771103, -1.40316737040426, -1.20396452055264, 0.944116062879409, 1.15199482901799, 0.112600998325067, -0.649621144183079, 0.112600998325067, -1.41184328669123, 0.944116062879409, 1.62735240868994, 0.457692864944047, -1.01709525543122, -0.966240492659655, 0.355983339400925, 0.457692864944047, -0.915385729888094, -1.60024519540936, 0.368555728511814, -0.273444572766829, 0.539755808852786, 0.582555828938028,
+#> 0.710955889193757, 0.4541557686823, 0.710955889193757, 0.4541557686823, 0.839355949449486, 0.839355949449486, -0.444644653107801, -2.92704581805189, 0.411355748597057, -0.487444673193044, -1.08664495438644, 0.4541557686823, 0.4541557686823, -0.982582433390192, 0.855284304367981, 0.604666112855503, 0.938823701538807, 0.521126715684677, 0.938823701538807, 1.02236309870963, 1.52359948173459, 0.855284304367981, 0.521126715684677, 0.270508524172199, 0.186969127001373, 0.186969127001373, -0.564885447536062,
+#> -0.481346050365235, 0.186969127001373, -0.147188461681931, -1.06612183056102, -1.90151580226928, -1.81797640509845, -1.6508976107568, -1.03375460805776, 1.00543256400138, 0.784520620361643, 0.767527393927816, -0.235072965667929, -1.28865300456515, -0.982308790835467, -0.60736882058566, 0.671838136737211, 1.55404983144264, -1.29108288398237, 0.936501645148839, -0.122152388497675, -0.783811159526746, 1.1570545688252, -0.122152388497675, 0.539506382531396, 0.649782844369575, -1.59985697712927, -1.49874929441839,
+#> -1.52952443393417, -1.25254817829217, 0.778611029749185, 0.763223459991296, 0.670898041443962, 0.778611029749185, 0.501634774107182, 0.53240991362296, 0.255433657980958, -1.73236989624399, 0.920106395223629, 0.920106395223629, 0.725071373792187, 0.744574875935331, 0.842092386651052, 0.608050360933321, 0.608050360933321, 0.354504833072446, 0.452022343788167, 0.432518841645023, 0.23748382021358, 0.0619523009252817, -1.04974732123394, -1.65435588767141, -2.0444259305343, -0.425635252653325, 0.561546372361002,
+#> 0.312760004859292, 0.362517278359634, 0.661060919361686, 0.462031825360318, 0.362517278359634, 0.26300273135895, 0.561546372361002, 0.213245457858608, 1.00936183386408, 0.412274551859976, -1.17995820015097, -1.42874456765268, -2.57316185816054, 0.652720946763042, 0.756405817277595, 0.94303858420379, 0.279455412910652, 0.94303858420379, 0.984512532409611, 0.611246998557221, 0.9637755583067, 0.839353713689237, 0.880827661895058, 0.818616739586327, -0.280442887867933, -1.35876554121928, -0.259705913765023,
+#> -1.0062369814698, 0.00987474957281466, -2.08455963482115, -0.778130266337787, -0.695182369926144, -0.15602104325047, -2.06382266071824, -0.326535337093487, -0.64317566397202, -0.722335745691653, -1.43477648116835, -0.0890550919345874, 0.860865888701011, 1.33582637901881, 0.940025970420644, 0.781705806981378, 0.385905398383212, 0.623385643542112, -1.43477648116835, 1.33582637901881, -1.27645631772909, -1.11813615428982, 0.781705806981378, -0.811390324142915, -0.333655834226993, -0.0151661742830455,
+#> 0.62181314560485, 1.52420051544604, 0.515649925623534, -1.50145125402147, 0.952895587539336, 0.123396550904374, 0.123396550904374, 1.6315766175134, 0.123396550904374, -1.00773849905239, 1.17912259753069, 0.123396550904374, -1.611010525696, -0.706102485730587, -0.93232949572194, 0.881224592662136, 0.911012466216912, 0.821648845552583, 0.613133730669148, -0.39965397019325, 0.702497351333477, 0.493982236450042, 0.374830742230937, -0.786896326405344, 0.0173762595736194, -1.59116891238431, -2.03798701570595,
+#> -2.16536769036434, 0.123813908597707, 0.630075223752775, 0.586052500695812, 1.02627973126544, 0.608063862224294, 0.91622292362303, 0.91622292362303, 1.00426836973696, 0.674097946809737, -0.844685998655467, -0.162333791272549, -1.68111773673775, -1.0427882524118, -0.580549660313692, -0.00825426057318046, -1.33843978050204, -0.387953559565809, 0.795304797109909, 0.969883898914523, 0.795304797109909, 0.83410015306649, 0.795304797109909, 0.737111763175037, 0.562532661370423, 0.252169813717776, -1.55181423826324,
+#> -1.51301888230666, -0.950486220936232, -1.71048312133187, -0.570161040443955, -0.696863493875945, 0, 0.50680981372796, 0.443458587011965, 1.14032208088791, 1.01361962745592, 1.01361962745592, 0.760214720591941, 0.696863493875945, -1.20367330760391, -1.39372698775189, -1.79228073302395, -0.0943305648959974, 0.0397181325877882, 0.799327418329239, 0.218449729232835, 1.15679061161933, 0.754644519167977, -1.43481753973385, 0.352498426716621, 0.410525809770407, 0.730936197883895, 0.250320615713663, 0.490628406798779,
+#> 1.05134658599738, 0.410525809770407, 0.410525809770407, 0.250320615713663, 0.89114139194064, 0.650833600855523, -2.1527572951375, -0.150192369428198, 0.570731003827151, -2.23285989216587, -0.63080795159843, -0.951218339711919, 1.09777898247417, 1.25185322562844, -1.0592604216856, -0.520000570645658, 0.866667617742763, 0.327407766702822, -0.828149056954196, -1.13629754326273, 0.460629573101917, 0.232705597484013, -2.02581379727521, 0.460629573101917, 0.460629573101917, 0.460629573101917, -0.036659100973509,
+#> 0.502070295941535, 0.709273910139629, 0.419188850262298, 0.481349934521726, 0.274146320323632, -2.39878030283178, -2.19978494713306, -2.27462096144913, -0.684355657232531, 0.10142249308626, 0.41947555392958, 0.513020571824674, 0.550438578982712, 0.569147582561731, 0.550438578982712, 0.550438578982712, 0.569147582561731, 0.569147582561731, 0.58785658614075, 0.475602564666637, 0.643983596877806, 0.606565589719768, 0.232385518139392, 0.157549503823316, -1.93785889702679, 0.317163203793117, 0.62998170616441,
+#> 0.134685744076529, 0.212890369669352, 0.473572454978764, 0.39536782938594, 0.421436037916881, 0.39536782938594, 0.525708872040646, 0.499640663509705, 0.499640663509705, 0.656049914695351, 0.212890369669352, 0.603913497633469, 0.0304129099527644, -2.52427152607947, -0.829837971568293, -2.65461256873417, -3.4479512110302, 0.320370811696458, 0.808856999827692, 0.843748870408494, 0.704181388085285, 0.599505776342877, 0.250587070534854, 0.63439764692368, 0.843748870408494, -1.00552027037403, 0.564613905762075,
+#> 0.599505776342877, -0.133223505853973, 0.459938294019668, 0.0761277176308417, -0.935736529212427, 0.0761277176308417, 0.0761277176308417, 0.145911458792446, -0.796169046889218, -1.31954710560125, 0.63439764692368, -1.25831264355251, 0.19573752233039, 0.307587535090613, 0.866837598891728, -0.0279625031900558, -0.810912592511617, -0.139812515950279, 0.419437547850836, 0.19573752233039, 0.866837598891728, 0.754987586131505, 0.754987586131505, 0.866837598891728, 0.754987586131505, -1.03461261803206,
+#> -2.71236280943541, -2.84393057774242, 0.484125051300891, 0.484125051300891, 0.137452589942213, 0.530348046148715, 0.484125051300891, 0.507236548724803, 0.530348046148715, 0.114341092518301, 0.484125051300891, -0.0705508868729942, 0.553459543572627, 0.692128528116098, 0.183675584790037, 0.414790559029155, 0.391679061605243, 0.507236548724803, -1.41101773745988, -2.17369715244898, 1.38187584759291, 1.00092628960784, -0.459380349334939, 1.06441788260535, 0.17553558064018, -0.0149391983523557, 0.0485523946451563,
+#> -0.332397163339916, -0.205413977344892, -0.649855128327475, 1.50885903358793, 1.12790947560286, 0.17553558064018, -1.41175424429762, -0.0784307913498677, -1.72921220928518, -1.60222902329015, 0.61040079387582, -0.122080158775164, 0.040693386258388, 0.61040079387582, 0.691787566392596, 0.935947883942924, 0.691787566392596, 0.122080158775164, 0.122080158775164, -0.040693386258388, 0.529014021359044, -0.854561111426148, 1.0173346564597, 0.935947883942924, 0.122080158775164, -1.58704206407713, -2.80784365182877,
+#> -1.0173346564597, 0.596519884716249, 0.547551834478348, 0.498583784240447, 0.449615734002546, 0.278227558169892, 0.6210039098352, 0.841360135905755, 0.302711583288843, 0.694455985192051, 0.694455985192051, 0.669971960073101, 0.033387306980387, 0.0578713320993375, 0.498583784240447, 0.106839382337239, 0.131323407456189, -0.603197346112327, 0.474099759121497, 0.033387306980387, -2.75779155657997, -1.92533470253566, -2.24362702908201, 0.532747766061453, 0.591178166210129, 0.435363765813661, 0.591178166210129,
+#> 0.571701366160571, 0.610654966259688, 0.649608566358805, 0.785946166705714, 0.766469366656156, 0.824899766804831, 0.474317365912778, 0.31850296551631, -1.22016423839881, -1.23964103844837, -2.13557384072806, -0.713767437110291, -1.84342183998468, -1.15567460699871, 0.519114000298201, 0.519114000298201, 0.411063122408078, 0.519114000298201, 0.573139439243262, 0.519114000298201, 0.627164878188324, 0.681190317133386, 0.951317511858694, 0.0869104887377076, 0.357037683463016, 0.789241195023509, 0.627164878188324,
+#> 0.897292072913632, 0.194961366627831, 0.357037683463016, -0.237242144932662, -0.777496534383279, -1.26372548488883, -1.69592899644933, -0.345293022822786, -3.15461584796599, -3.3583788023189, -1.40464512644517, 0.549088549428566, 0.66401405977408, 0.549088549428566, 0.0893865080465108, 0.893865080465107, 0.434163039083052, -0.025539002299003, 0.549088549428566, 0.778939570119593, 0.0893865080465108, -0.025539002299003, -0.25539002299003, 0.549088549428566, -0.485241043681058, 0.434163039083052, -0.025539002299003,
+#> -1.73322501015519, -1.67489532231343, 0.774951567040543, 0.833281254882304, 0.424973439989975, 0.774951567040543, 0.774951567040543, 0.541632815673497, 0.891610942724065, 1.18325938193287, 0.833281254882304, 0.599962503515259, 0.424973439989975, -0.858279692528773, -0.624960941161728, -0.216653126269399, -1.38324688310462, -1.38324688310462, -0.741620316845251, 1.29991875761639, -0.741620316845251, -2.12243957496301, -1.73174945597785, 0.612391257933082, 0.649599840693573, 0.630995549313327, 0.593786966552836,
+#> 0.575182675172591, 0.668204132073818, 0.575182675172591, 0.519369801031854, -0.262010436938458, -0.70851343006435, -1.60529452512281, -1.9989003942635, -1.74421424364306, 0.270121674900474, 0.663727544041164, 0.0154355242800272, 0.802647262561407, 0.362734820580636, 0.223815102060392, 0.941566981081651, 0.895260408241569, 0.0848953835401489, 0.686880830461204, 0.987873553921732, 0.733187403301285, 0.432194679840758, -0.308710485600541, -1.44322152018253, -1.44113470744851, 0.559053451962992, -1.45664004201759,
+#> 0.698601463084725, 0.76062280136105, 0.791633470499213, 0.574558786532073, 0.76062280136105, 0.791633470499213, 0.729612132222888, 0.714106797653806, 0.807138805068295, 0.776128135930132, -0.97597467037607, 0.10939874945963, -1.1155226814978, -1.534166714863, -1.54967204943208, -0.919703766177051, 0.745130366115666, 0.769258397018459, 0.745130366115666, 0.672746273407287, 0.648618242504494, 0.672746273407287, 0.527978087990529, -1.06447195159381, 0.021289439031876, 0.745130366115666, 0.334953840768185,
+#> -0.557783302635156, -2.77756214569211, -0.244118900898847, 0.817514458824045, -1.13685604430219, 0.173988741366182, 0.511731592253477, 0.327508219042225, 0.788066652070354, 0.972290025281606, -2.34373069252092, 0.419619905647851, -0.470793064873198, -0.378681378267573, -1.66238013330221, 0.326792675777357, 0.658321477290617, 0.525709956685313, 0.592015716987965, 0.724627237593269, 0.724627237593269, 1.12246179940918, -0.601487968459772, -1.26454557148629, -0.336264927249164, 1.45399060092244, -1.06562829057834,
+#> -1.19823981118364, -1.69780232662066, -1.69780232662066, 1.07202624248857, 0.241077671755803, 0.610388147637034, 0.425732909696419, 0.425732909696419, 0.887371004547956, 0.702715766607341, 0.702715766607341, 0.518060528666726, 0.887371004547956, 0.610388147637034, -0.589870898976965, -2.2517680404425, -0.77452613691758, 0.148750052785496, -0.220560423095734, -0.340714301855999, -0.306642871670399, 0.1022142905568, -0.136285720742399, 0.613285743340798, 0, 0.749571464083197, 0.988071475382396, 0.954000045196796,
+#> 1.46507149798079, 0.1022142905568, 0.647357173526397, -2.21464296206399, -1.39692863760959, -1.2265714866816, -1.97872523214332, -1.1992274134202, 0.966044305255158, 1.05265517400217, 0.273157355279045, 0.706211699014116, 0.79282256776113, 0.79282256776113, 0.879433436508144, -0.766173069685126, 0.0133247490380021, -1.11261654467318, -0.419729594697069, 0.395918614210883, 0.823168917316152, 0.395918614210883, 0.43864364452141, -0.330406901068075, -1.20627002243388, 0.823168917316152, 0.823168917316152,
+#> 0.823168917316152, 0.759081371850362, 0.630906280918781, -0.864469779949661, -1.91123302255757, -1.93259553771283, 0.331831068745092, -0.492598449629783, -1.1445669859045, 0.767874053834661, 1.11559060651451, -0.0579527587799749, 0.463622070239795, 0.854803192004623, -0.275275604204879, 0.594015777494738, -0.362204742374841, 0.854803192004623, -2.31811035119898, -1.5845469473268, -0.655337317721577, 1.11016097852834, 0.775645511870464, 1.07299259334414, 1.18449774889676, 1.11016097852834, 0.719892934094151,
+#> 0.162367156331018, 0.868566474830986, 0.552635200765211, 0.812813897054673, -1.32436825103734, -0.952684399195248, -1.1571105177084, -0.0792273473663398, -0.711089895497891, -0.302237658471593, -1.6031311399189, -1.08315469082085, 0.516960193346313, 0.23694008861706, 0.716974553867208, 0.896987478336014, 1.07700040280482, 0.876986042283925, 0.836983170179746, -0.0430800161121929, 0.336947268877508, -1.50318484791473, -1.24316617923756, -1.62319346422726, -1.15976092630769, 0.520859550873555, 0.621195101750047,
+#> 0.194769010524955, 0.596111214030924, 0.621195101750047, 0.796782315783908, 0.370356224558817, 0.872033978941278, 0.0693495719293402, 0.872033978941278, 0.897117866660401, 0.39544011227794, -1.51093535437541, -0.382160407014875, -1.43568369121804, -2.33870364910647, -0.80853131619839, -0.498675003403797, 0.45671529437953, 1.02478520116962, 0.895678404171869, 0.353429856781332, 0.508358013178628, 0.84403568537277, 1.33464151396421, 1.12807063876781, -2.15124200497496, 0.224323059783585, -0.317925487606952,
+#> -0.756888597399291, -0.989280831995236, -1.24749442599073, -1.72277459513231, 0.822233329494965, 1.67056930437072, 0.10441058152317, 0.691720102591003, -1.98380104894023, 0.365437035331096, 0.430693648783077, -0.287129099188718, -0.417642326092681, -0.287129099188718, -0.482898939544662, 0.952746556398928, 0.887489942946947, -0.743925393352588, -1.44119565248966, -1.22934952094329, -2.17302774328619, 0.465419531427618, 0.523195749122081, 0.619489445279519, 0.619489445279519, 0.600230706048031, 0.484678270659106,
+#> 0.658006923742494, 0.542454488353568, 0.330608356807204, 0.825552831995476, -0.328821890710062, -1.29080082629801, -0.888518725961232, 0.790571779792278, 1.07042019741786, 0.965477040808268, 0.143422314033112, 0.405780205557098, -1.69308292663479, 0.623819149532124, 0.675501840699756, 0.675501840699756, 0.6927294044223, 0.865005041647741, 0.761639659312476, 0.520453767196859, -1.35735067856045, -1.59853657067607, 0.193130056468521, 0.675501840699756, 0.778867223035021, 0.727184531867388, 0.623819149532124,
+#> -0.702703257103773, -1.44348849717317, -1.87417759023677, 0.520453767196859, -1.35735067856045, -0.823751565989568, -1.37514713754445, 0.663345581537239, 1.08106949938185, 0.89727097553022, 1.14790532623698, 1.04765158595428, 1.01423367252671, 0.329166447261552, 0.780308278533729, -1.22476652712039, 0.596509754682101, 1.1311963695232, 0.62992766810967, -0.472863475000097, -0.823751565989568, -1.09109487341012, -1.22476652712039, -0.890587392844706, -1.39185609425824, -0.170722318567099, -0.0497940095820708,
+#> -0.412578936537156, -0.0497940095820708, 1.03856077128318, 1.64320231620833, 0.554847535343071, 0.312990917373014, -0.0497940095820708, 0.312990917373014, 0.675775844328099, 0.433919226358043, 0.433919226358043, -0.0497940095820708, -0.170722318567099, -2.83114511623772, -1.62186202638744, -1.53839566895061, -0.604987060823272, 1.15811808786169, 0.950693952722284, 1.20997412164654, 0.0691413783798026, 0.172853445949506, 0.224709479734358, 1.05440602029199, -0.760555162177827, -0.29385085811416, -1.64210773652031,
+#> -2.14810656044017, -2.01218785097628, -0.313203982677659, 0.2304708551779, 0.570267628837625, -0.653000756337384, 1.31782053088902, 2.60904827079597, 0.0265927909820654, 0.298430209909845, 0.434348919373735, 0.63822698356957, 0.162511500445955, 0.36638956464179, -0.0413665637498796, 0.2304708551779, 0.36638956464179, 0.36638956464179, 0.162511500445955, 0.0945521457140103, -1.19667559419294, -0.517082046873494, -0.992797529997109, -1.09800805935401, 0.485042395151528, 0.772869750516171, 1.03671149293376,
+#> 0.748884137569118, 0.00533013621045651, 0.676927298727957, -1.76960522187151, -0.858151929883473, 0.078519911568173, -1.28891175593039, -1.46224816448654, 0.829644348644846, 0.983721156250318, 0.868163550546214, 0.94520195434895, 0.925942353398266, 0.829644348644846, 0.0400007096668051, -0.22963370364277, -1.01927734262081, -1.50076736638791, -2.20258011594326, 0.64438860330529, 0.521497867222618, 0.828724707429297, 0.623906813958178, 0.603425024611066, 0.623906813958178, 0.337161763098611, -0.994154544463662,
+#> 0.705833971346625, 0.54197965656973, -0.768854861645431, -1.46523569944724, -1.55776910150187, -0.296558054524422, -0.167863049730805, -0.553948064111656, 1.01613099437047, 0.449872973278557, 1.22204300204026, 0.964652992453026, 0.578567978072174, 0.913174990535579, 0.938913991494302, 1.01613099437047, -0.193602050689528, -0.811338073698891, 0.449872973278557, 0.39839497136111, 0.24396096560877, -2.61306814080953, -1.06872808328612, 0.733001983824515, -0.116385047813358, 0.115265960815153, -1.66072510533676,
+#> -1.67645814138906, -0.866357562999717, 0.618826830714084, 0.416301686116747, 0.0787597784545199, 0.551318449181639, 1.56394417216832, 0.821351975311421, 0.686335212246529, 0.213776541519411, -1.06888270759705, -1.33891623372684, -0.558594935428878, -0.452195900109092, 1.88858287692621, 1.25018866500749, 0.718193488408558, 0.186198311809626, 0.398996382449199, 0.611794453088771, 0.292597347129412, -2.26097950054546, -0.984191076708023, -1.1969891473476, 0.398996382449199, 0.186198311809626, 0.186198311809626,
+#> -0.664993970748664, -2.24585786835688, -2.07729638222567, -1.42177949171542, 0.357480639669569, -0.710075439161422, 0.488584017771621, 0.694603611931987, 0.675874557917409, 0.65714550390283, 0.694603611931987, 0.33875158565499, 0.582229287844515, 0.600958341859093, 0.675874557917409, 0.563500233829936, 0.600958341859093, 0.563500233829936, 0.5073130717862, 0.544771179815357, 0.5073130717862, 0.33875158565499, -1.02846935740926, -1.90873489609447, -1.48414146050708, -1.50207253763216, -0.7131051441284,
+#> -0.35448360162669, -1.10758884088028, 0.882760720004208, 0.811036411503867, 1.08000256838015, 1.06207149125506, 0.775174257253696, 0.775174257253696, 0.488277023252328, -0.7131051441284, -0.152958880615171, 0.780402452118218, 0.922435698403733, 0.90214523464866, 0.73982152460807, 0.922435698403733, 0.597788278322555, 0.049945756935566, 0.29343132199645, -0.376153981920981, -1.99939108232687, -1.5935818072254, -1.08632021334856, 0.0977533149266803, -1.73783670980765, -0.382324076157682, 0.267192394132926,
+#> 0.662550245614166, 1.36854640897352, 1.25558702283603, -0.636482694967051, 0.803749478286037, -1.87903594247952, 0.182472854529803, 0.351911933736049, -0.354084229623308, 0.214728891004106, -2.36911627678084, 0.214728891004106, 0.353149167849728, 0.560779583118161, 0.699199859963783, 0.768409998386594, 0.72226990610472, 0.445429352413476, 0.699199859963783, -0.43123240094213, -0.0390416165462008, -1.83850521553929, -0.721056607043392, 0.480704404695595, 0.287564242094686, -0.0772560650403633, 0.480704404695595,
+#> 0.394864332428524, 0.201724169827616, 0.416324350495292, 0.695304585363271, 0.630924531162968, 0.695304585363271, 0.52362444082913, 0.566544476962665, -2.54515814271864, -2.03011770911622, -1.24503744197544, -1.41215656170369, 1.11134214619285, 1.1447659701385, -0.259034635578784, 0.960934938437423, 1.19490170605697, 1.26174935394827, -1.06120641027437, 1.17818979408414, -0.777103906736351, -0.00835595598641238, -0.0250678679592371, -0.459577579252681, -0.426153755307031, -1.17818979408414, -1.92127150019158,
+#> -1.90270321394755, 0.102671700408191, -0.361535455692674, 0.548310570265022, 0.214081417872399, 0.41833256655678, 0.696856860217299, 0.641152001485195, 0.696856860217299, 0.863971436413611, 0.919676295145715, 0.919676295145715, 0.771130005193438, -1.80986178272737, -0.30583059696057, -0.491513459400916, -0.422423069043626, 0.111163965537796, 0.771795532162414, 0.466888655258744, 0.568524280893301, -0.752738852355934, 1.07670240906608, 1.17833803470064, 0.924248970614248, -0.371605256226347, -0.778147758764573,
+#> -0.778147758764573, 1.07670240906608, 0.416070842441466, -1.0576457292596, -2.42972667532612, 0.480850582106513, 1.79460306536181, 0.0171732350752326, 0.403571024267967, 0.7899688134607, -0.832901901148782, -1.37385880601861, -0.214665438440408, -1.06474057466442, -1.29867780885957, 0.495548111275362, -0.683514636241879, -0.0683514636241878, 0.187966524966517, -1.19615061342329, -0.683514636241879, -0.17087865906047, 0.39302091583908, 0.854393295302349, 2.08471964053773, 1.4182928702019, 0.649338904429785,
+#> -1.04235982026887, -0.939832624832584, -2.29341236146931, -0.331270674434456, -0.779760202899567, -1.06006615819026, 0.958136719902736, 1.12632029307715, 0.565708382495764, 0.565708382495764, 0.677830764612042, 1.01419791096087, 1.46268743942599, 1.07025910201901, -0.219148292318179, -1.17218854030654, -1.8449228330042, 0.341463618263209, 0.958136719902736, -0.0509647191437624, -0.443393056550734, 0.117218854030654, -0.387331865492595, -0.275209483376318, 1.05525600813467, 0.835846343076965, 1.20152911817314,
+#> -0.992567532403896, -0.261201982211552, -0.919430977384662, -0.919430977384662, -1.83317818809867, -1.93629446117922, -0.355178273944118, -0.767643366266319, 0.280705410052609, 0.55568213826741, 0.761914684428511, 0.744728638915085, 0.572868183780835, 0.710356547888235, 0.72754259340166, 0.538496092753985, -1.43374346848926, 0.805067310381982, 1.14428106475641, 1.07643831388153, 1.00859556300664, 0.533696306882438, 1.00859556300664, 1.2121238156313, -0.144731201866424, -0.55178770711574, -1.2302152158646,
+#> -1.29805796673949, -0.755315959740399, -0.687473208865513, -0.687473208865513, -2.38847560284633, 0.0239938188413788, 0.146144169306579, -0.311919644937922, 0.45152004546958, 0.45152004546958, 0.665283158783681, 0.634745571167381, 0.695820746399981, 0.879046272097782, 0.0850689940739791, 0.665283158783681, 0.054531406457679, -2.05256213906703, -0.627911139759241, 0.665398371983674, -1.35891216813567, 0.271782433627135, -1.69629725815556, 0.496705826973729, 0.609167523647026, 0.496705826973729, 0.946552613666917,
+#> 1.11524515867686, 0.946552613666917, 1.05901431034021, 0.665398371983674, -0.178064353066053, 0.159320736953838, -1.52760471314562, -0.178064353066053, -1.86498980316551, -3.41917059709853, 0.522445129057415, 0.522445129057415, 0.522445129057415, 0.553481473357856, 0.770735883460939, 0.584517817658296, 0.677626850559618, 0.584517817658296, 0.646590506259177, -0.222427134153157, -0.160354445552276, 0.336227063254772, 0.274154374653891, -0.0362090683505136, -0.408645199955799, -0.687972298659764, -1.06040843026505,
+#> -1.29117727951901, 0.514988929277311, 0.514988929277311, 0.987370860808657, 0.125968515075026, 0.792860653707515, 0.792860653707515, 0.376053067062209, 0.542776101720331, 0.653924791492413, -0.707646658215586, -2.29151548746775, 0.0703941701889849, 0.542776101720331, -1.62462334883526, 0.347404166889826, 0.833770000535581, 0.764289167157616, -0.416885000267791, 1.45909750093727, -0.764289167157616, -0.764289167157616, -1.45909750093727, -2.56399967503696, -2.69196269024214, 0.165877982673371, 0.443131182284577,
+#> 0.485785520686301, 0.507112689887163, 0.549767028288887, 0.507112689887163, 0.507112689887163, 0.528439859088025, 0.528439859088025, 0.485785520686301, 0.400476843882853, 0.251186659476819, 0.379149674681991, -0.452609924151627, 0.357822505481129, -0.388628416549041, -2.65008797479142, -1.56480034057545, -0.0453976526730863, 0.871067460664847, 0.605774927856498, 0.581657424873921, 0.509304915926189, 0.461069909961035, 0.895184963647424, 0.702244939786807, 0.0993073652223769, 0.461069909961035, 0.171659874170108,
+#> 0.292247389082994, 0.340482395048149, -0.0453976526730863, -1.68538785548834, -2.01019573627833, -0.256839318945272, 0.345876949512966, 0.510254113637939, 0.711159536457352, 0.546782372332378, 0.875536700582326, 0.839008441887887, 0.820744312540668, 0.820744312540668, 0.857272571235106, 0.656367148415694, -1.00566862218126, -0.950876234139605, -1.37095120912565, -1.38921533847287, -1.22289526037196, 0.299775880947212, 0.807332928053603, 0.553554404500407, 0.743888297165304, 0.997666820718499, -2.46006556269379,
+#> 0.172886619170614, 0.172886619170614, 0.458387458167959, 0.9342221898302, 0.807332928053603, 0.490109773612109, 0.585276719944557, 0.204608934614764, -2.46006556269379, -0.525004320600673, -0.14433653527088, -0.176058850715029, -0.239503481603328, -1.42508535853195, -0.531748268108937, -0.755082540714691, -1.57397487360245, -0.308413995503183, 0.882702125060836, 0.733812609990333, 0.882702125060836, 1.25492591273709, 0.584923094919831, 0.882702125060836, 1.10603639766659, -0.978416813320444, -0.755082540714691,
+#> 0.203554760175173, -0.610664280525519, 1.20935475162897, -0.993826182031726, -0.0838166659544829, 1.64041189082345, -0.179607141331035, -1.18540713278483, -1.35903775181555, -0.00530874121802947, -0.998043348989544, -0.591924645810288, -1.72003215464156, -0.185805942631032, -0.00530874121802947, 0.761804364787232, 0.220312760548224, 0.987425866553485, 0.806928665140483, 1.30329596902624, 1.07767446725999, 1.12279876761324, 0.400809961961227, -0.00530874121802947, -1.81028075534806, -0.565233418944222,
+#> -0.320298937401726, -1.22467240771248, 0.546392304979414, 1.05510238202921, 0.847850128416332, 1.11162572392364, 0.753644558592295, 0.86669124238114, 0.584074532909029, -0.659438988768258, -1.24351352167729, -1.75222359872709, -1.3980652425567, -0.0427979155884705, -1.11274580530023, 1.24113955206564, -0.970086086671996, 0.0998618030397641, 0.884490255495055, 0.599170818238585, 1.45512913000799, 1.24113955206564, 0.313851380982116, 0.527840958924468, -0.542106930787292, -0.827426368043761, -1.46939510187082,
+#> -1.20848237537656, -0.191508135988634, 0.733013899818567, 0.640561696237847, 0.178300678334246, 0.085848474753526, 0.363205085495686, 0.270752881914966, 0.085848474753526, 1.74998813920649, 0.640561696237847, -0.0990559324079142, -0.746221357472955, -2.50281322550664, -1.94169854030247, -1.35074681064519, 0.658489070189533, 0.71758424315526, 0.00844216756653265, 0.599393897223805, 1.19034562688108, 0.658489070189533, 0.540298724258078, 0.00844216756653265, 0.422108378326624, 1.19034562688108, 1.07215528094962,
+#> -0.700699908022195, -1.70531784843956, -0.287033697262104, 0.363013205360896, 0.422108378326624, 0.363013205360896, 0.00844216756653265, -0.58250956209074, 0.244822859429442, -1.94169854030247, -1.88260336733674, 0.776679416120987, 0.303918032395169, 1.54491666467544, -0.700699908022195, -1.15397982643654, 0.612315826272452, 0.541664000164092, 0.595714608996682, 0.242240795359646, -0.111233018277389, 0.692116558170419, 0.917054439575805, 1.01345638874954, 0.0173029139542603, -0.304036916624863, -0.143367001335301,
+#> 0.274374778417559, -0.0790990352194766, -0.111233018277389, -3.0032914934895, -2.08757720723088, 0.716065503024746, 0.488743121112129, 0.640291375720541, 0.697121971198695, 0.602404312068437, 0.204590143721356, 0.621347843894489, -0.477377002016498, -1.40561006149302, -1.10677027182856, -1.25701058022158, -1.33213073441809, -1.70773150540063, 1.1468343540667, 1.44731497085273, 0.395632812101612, 0.696113428887646, 0.470752966298121, 0.620993274691138, -0.0550881130774397, 0.696113428887646, 0.470752966298121,
+#> 0.470752966298121, -0.956529963435543, -1.51003942004539, 0.405784884637702, 0.792465019527867, 1.33733248232764, 1.03853419627615, 1.14399241488256, -1.22881750376163, 0.230021186960355, 1.17914515441803, 0.792465019527867, -1.10578291538749, 0.634277691618254, -1.33427572236804, -0.52576271305224, -0.367575385142627, -0.139082578162075, -1.07063017585202, -1.2639702432971, 0.88034686836654, 1.24945063348897, 0.511243103244111, -0.262117166536218, -1.38700483167124, 0.462246249447184, -1.1698824831688,
+#> -2.06013451914115, 1.35249828541954, 0.536433919111547, 0.610621588775909, 0.833184597768998, 0.462246249447184, 0.536433919111547, -0.650568795518259, 0.313870910118458, 0.165495570789732, -1.39244549216189, 0.876943671165056, 1.02371248642281, 1.50071113601049, 0.913635874979493, -0.810897704299068, 0.0330229834329937, -0.664128889041319, -1.28789635388676, -0.994358723371256, -0.590744481412444, -0.404650683159522, -0.404650683159522, 1.06137884107415, 0.49752133175351, 0.384749829889381, 0.441135580821445,
+#> 1.00499309014209, 0.666678584549703, 0.723064335481768, 0.328364078957316, 0.271978328025252, -1.92706595832526, 0.215592577093187, 0.610292833617639, -2.71646647137416, -0.404650683159522, -0.348264932227457, -2.07564764373798, -1.68184888128967, 0.0902455497277381, 0.680943693400207, 0.188695240339816, 0.385594621563973, 0.877843074624364, -0.500452593944731, 0.680943693400207, -0.402002903332653, 0.976292765236442, 0.779393384012286, 0.22472622307697, 0.870814114423259, 0.386248195913542, 0.386248195913542,
+#> -0.582883641105892, 0.870814114423259, 0.92465477203545, 0.709292141586687, 0.978495429647641, 0.92465477203545, 0.22472622307697, -1.01360890200342, 0.440088853525733, 0.22472622307697, 0.27856688068916, 0.601610826362305, 0.332407538301351, 0.00936359262820656, 0.170885565464779, -2.09042205424723, -2.8441912608179, -0.690564956330274, -1.33665284767656, -1.38439331747696, -1.63068812078175, 0.374855277557299, 0.920222342017918, 0.902629856067575, 0.920222342017918, 0.920222342017918, 0.515595165160039,
+#> 0.920222342017918, 0.251707875904901, -0.627916421612226, -1.34920834557627, -0.733471337314282, -1.60987460333623, 0.850499790441784, 1.30612467817845, 0.637874842831338, 0.273374932642002, -0.212624947610446, -0.75937481289445, -0.60749985031556, 1.39724965572579, 1.06312473805223, 0.030374992515778, 0.091124977547334, -0.789749805410228, -1.67062458836779, -1.91638167451955, -1.95052149057394, 0.0637276566348545, 0.0637276566348545, 0.388055909151524, 0.251496644933979, 0.575824897450649, 0.695314253641001,
+#> 0.763593885749774, 0.661174437586615, 0.729454069695388, 0.285636460988365, 0.558754989423456, 0.609964713505035, -1.77982241030201, -1.74282807983308, 0.281101303198884, 0.843303909596653, 0.543462519517843, 0.787083648956876, -0.955744430876207, 0.712123301437174, -1.31180608159479, 0.449762085118215, 1.16188538655539, 0.412281911358364, -1.18062547343531, -1.49884802650408, -1.49884802650408, -1.44912321045892, -1.34967357836861, 0.887943143663557, 1.08684240784419, 0.490144615302283, 0.291245351121647,
+#> 0.788493511573238, 0.68904387948292, 0.241520535076487, 0.241520535076487, 1.03711759179903, 0.0426212708958506, 0.426749456172497, -0.190450170523263, 0.573701748242916, 0.397358997758413, 0.162235330445743, 0.191625788859826, 0.397358997758413, 0.485530373000664, 0.514920831414748, 0.338578080930245, 0.514920831414748, 0.603092206656999, 0.573701748242916, 0.573701748242916, 0.573701748242916, 0.485530373000664, 0.603092206656999, 0.573701748242916, -1.04277346453169, 0.573701748242916, 0.250406705687994,
+#> -3.42340059607248, -1.3954589655007, -0.690087963562687, -2.07143950902462, -0.72725617153287, 1.13113047261714, 1.19044068466448, 0.854349483062886, 1.03228011920491, 0.656648776238417, 0.162397009177243, 0.696188917603311, -0.865646666309999, -0.490015323343507, 0.300787503954371, -0.667945959485529, -1.91346041247969, -1.35989843337117, -1.57884172859023, 0.0264020355951543, 0.702294146831105, 1.04024020244908, 0.279861577308636, 0.786780660735599, 0.617807632926611, -0.311544020022821, 0.702294146831105,
+#> 0.702294146831105, 0.36434809121313, 0.617807632926611, -0.396030533927315, 0.36434809121313, -1.57884172859023, -2.33922035373067, -2.16473462008244, -1.49282700333595, -0.409105040841612, 0.436198089903971, 0.848012435651819, 0.848012435651819, 0.956384631901253, 0.913035753401479, 0.804663557152045, 0.674616921652725, 0.0677326226558961, 0.349500332904424, 0.631268043152951, -0.322407283842065, -0.56082611559082, -1.5795247603355, -1.86526732221087, 0.655575125797962, 0.655575125797962, 0.92092696243047,
+#> 0.788251044114216, 0.655575125797962, 0.92092696243047, 1.45163063569549, -1.06921181231334, -0.00780446578330951, 0.257547370849199, 0.655575125797962, -0.538508139048326, -0.140480384099564, -1.33456364894585, -0.273156302415818, -1.73259140389461, -1.79709125604092, 1.00761764067034, 0.695983318813537, 0.758310183184899, 0.135041539471283, 0.446675861328091, 0.446675861328091, 0.571329590070814, -0.862188290470502, 0.695983318813537, -1.92174498478365, -0.176592782385525, 0.291485522415928, 1.6101105047737,
+#> 1.43429384045933, 0.97277509663411, 1.36836259134144, 0.357416771533817, -0.565620716116623, -0.961208210823955, -0.301895719645069, 0.753004266241148, 0.489279269769594, 0.884866764476926, -0.851322795627474, -0.389804051802254, -1.31284153945269, -1.15900195817762, -0.0381707231735146, -1.04911654298114, -1.53261236984566, -2.76552533310546, 0.226516133640667, 0.632216671504549, 0.632216671504549, 0.581504104271564, 0.73364180597052, 0.277228700873653, 0.581504104271564, 0.632216671504549, 0.530791537038579,
+#> 0.226516133640667, 0.226516133640667, -0.838447778252022, -0.0270467025242587, -1.64984885397979, -1.04338304871972, 0.15024715901564, 1.1372875231045, -0.148160392918201, 0.678198981667821, 0.999560960673496, 0.747062262883323, -1.64019815258741, 1.02251538774533, -0.882702059216887, -1.02042862164789, -1.77124681690407, -1.80572923384574, 0.849416870663274, 0.642522369013221, 0.814934453721599, 0.590798743600708, 0.280456991125628, 0.711487202896572, 0.780452036779923, 0.245974574183952, -1.75400560843323,
+#> 0.590798743600708, 0.26321578265479, 0.332180616538141, -0.771256725595477, -2.43608397645347, 1.0375066841556, 1.01465411402002, 0.557602711308299, 0.123403878732165, 0.808980982799745, 0.0319935981898205, 0.123403878732165, 0.877538693206503, 0.7175707022574, -1.01922462804714, 0.260519299545681, 0.0548461683254065, -0.722141216284517, -1.43057089048768, -0.656093105891913, 0.325422180522389, 0.402403771613706, 0.710330135978978, 0.248440589431071, 1.07599269366274, 1.05674729588991, 0.922029511480101,
+#> -1.21420964130397, -1.34892742571377, -1.52213600566924, -1.85755688734158, -1.32777535219454, -1.2181653794055, -1.85755688734158, -1.78448357214888, 0.773082459595444, 0.243300924448405, 0.718277473200923, 0.809619117191792, 0.572130842815533, 0.864424103586313, 0.0423493076684936, 0.937497418779008, 0.955765747577182, -0.195138966707765, 0.937497418779008, 0.846155774788139, 0.663472486806402, 0.517325856421012, -0.761457159451152, 0.206764266852058, -0.0855289939187227, -1.47218925251377, -0.649443772512022,
+#> 1.03105763344901, 0.90852107259768, 1.15359419430033, 1.17109941727909, 0.978541964512723, 1.11858374834281, 1.15359419430033, 1.10107852536405, 0.208312153447252, 0.103280815574688, -0.877011671235911, -0.877011671235911, -0.299339312936808, -0.316844535915569, -0.649443772512022, -1.03455867804476, -1.43717880655625, -1.31464224570493, 0.746067236684058, 0.333349190858834, -1.47229225962652, 0.462323580179217, -0.105163732830466, 0.875041626004441, 0.359144068722911, 0.0754004122180696, 0.978221137460746,
+#> 0.384938946586987, -0.0277790992382363, 0.0238106564899167, -2.63306176350996, -2.67207951820433, -0.215192782183966, -0.945618568568397, 0.426696545244777, 0.692305922111843, 0.55950123367831, 0.55950123367831, 0.271757742072322, -0.170924552706121, 0.802976495806454, 0.847244725284298, 0.847244725284298, 0.581635348417232, 0.404562430505855, 0.537367118939388, -0.193058667445043, -0.193058667445043, -2.14086076447019, -0.33051615176129, -0.0631322986510329, 1.05096708930837, 1.00640311379, 1.1846590158635,
+#> 0.649891309642987, 0.694455285161363, 0.337943481014353, -0.196824225206162, -1.53374349075745, -1.53374349075745, -1.26635963764719, -2.93661531517869, -0.469447255752019, 0.661338104818537, 0.301542762818815, 0.455740766532982, 0.944034444961177, 0.944034444961177, 0.635638437532843, -0.032552911895213, 0.764136773961315, -0.18675091560938, -0.212450582895074, 0.301542762818815, 0.0445460899618704, -1.21473760703716, -1.53766874889482, -0.992340360539968, 0.664618973307482, 0.769489817221877, 0.874360661136273,
+#> 0.727541479656119, 0.811438154787636, -0.279218621922078, 0.329032272781416, 0.811438154787636, 0.811438154787636, 0.664618973307482, 0.601696466958844, -1.03428869810573, -1.83130711185513, -1.39084956741467, 0.833526127344216, 0.600997379372654, 1.03028122178169, 0.708318339974913, 1.03028122178169, 0.0286189228272691, -1.36655356500211, -0.847835588757851, -1.59908231297367, -0.418551746348813, 1.31916776571269, 1.16118360215429, 0.655634278767386, -0.987401022240039, -0.639835862411545, -0.197480204448008,
+#> 0.118488122668805, -1.42975668020358, -0.449754151813275, 0.460998005608607, 0.258608637292633, 1.04286743951703, 1.16936079471452, 0.233309966253137, -0.0955727572603208, -0.424455480773778, -2.19536245353855, 1.32470545798003, 1.2022904321601, 1.18480257132868, 0.695142468048929, 0.852533215531705, -0.598959233476121, -0.476544207656184, -1.21103436257581, -1.33344938839574, -0.0043719652078549, -0.721374259296058, -0.913740728441673, 1.01594381087906, 0.296455734977823, 0.596242433270003, 0.656199772928439,
+#> -0.42303234092341, 0.95598647122062, -1.02260573750777, 0.116583716002514, 0.776114452245311, -0.12324564263123, -0.602904359898718, 0.356413074636259, -1.5622217944337, -0.363075001264974, 2.0951759247309, -1.742093813409, -1.32239243579995, 0.296455734977823, -2.28374565847407, 0.44166779244074, 0.44166779244074, 0.323171555444444, 0.323171555444444, 0.678660266433332, 0.560164029437036, 0.204675318448148, 0.44166779244074, 0.560164029437036, -1.69126447349259, -1.27581468280604, -0.01712502929941,
+#> -1.16138835066908, -1.09600187516224, 0.914632246673032, 1.22521800533051, 0.947325484426451, 0.391540442618328, 0.702126201275808, 0.881939008919613, 1.22521800533051, 1.2088713864538, 0.195381016097814, 0.767512676782646, -1.17773496954579, -1.19408158842249, -0.572910071107533, -0.556563452230824, -1.32485453943617, 1.04540519768671, -1.12869511291566, -2.64069564092982, -0.112997208821183, 0.119138361474508, 0.815545072361581, 0.712373707785719, 0.557616660921925, 0.402859614058131, 0.841337913505547,
+#> 0.609202343209856, 0.738166548929684, 0.660788025497787, 0.918716436937444, 0.712373707785719, 0.299688249482268, 0.119138361474508, -1.27367506029964, 0.248102567194337, 0.351273931770199, -1.17050369572378, -1.91849608889878, -0.989953807716016, -0.919443769556815, -1.52282874332848, -1.00564162295277, 0.804513298362213, -0.229860942389204, 0.890711151758164, 1.88198646581161, 0.244227251288529, -0.660850209368961, 0.33042510468448, 0.675216518268286, 0.589018664872335, 1.23550256534197, 0.804513298362213,
+#> 0.201128324590553, -1.39353196323455, -0.531553429275034, -1.39353196323455, -0.00232577873013393, -1.38616412315974, -0.555861116501978, -1.50477883839657, 0.11628893650669, 0.511671320629436, 1.73735671140995, -0.0814022555546831, -0.793090546975625, 1.1838213736381, 1.5001272809363, 0.630286035866259, -1.1489346926861, -0.160478732379232, -1.1489346926861, 0.907053704752181, 0.195365413331239, 0.917076124669799, 0.52432403701678, 0.897438520287148, 0.858163311521846, 0.720700080843289, -1.73400046698808,
+#> -0.221904929523955, 0.288672784424969, -0.850308269768785, -1.40016119248301, -1.27638554831707, -1.15162605863194, -1.15162605863194, -1.19841086726386, 1.14082956433227, 1.10963969191099, 0.704171350434323, 0.969285266015217, 1.03166501085778, 0.407867562432146, 0.423462498642787, -0.0599805238870802, -0.94889188789361, -2.21350683126743, -0.667565552287002, 1.07161838656598, 0.926686391661562, 1.04746305408191, 0.588511736884594, -0.643410219802933, 0.298647747075764, 0.12956041968728, 0.250337082107626,
+#> -0.788342214707348, -1.63418658129375, -1.30269677654733, 0.73858254741746, 0.721135715588701, 0.546667397301112, 0.529220565472353, 0.947944529362566, 0.947944529362566, 0.756029379246219, 0.878157202047531, 0.721135715588701, -0.552483007910698, -0.587376671568216, -1.30269677654733, -1.40737776751988, -2.95381541242687, 0.0987597858258224, 0.505769812259515, 0.35314105234688, 0.607522318867939, 0.505769812259515, 0.124197912477928, 0.861903585388997, 0.811027332084785, 0.861903585388997, 0.200512292434246,
+#> 0.505769812259515, -0.155621480695236, -0.257373987303659, 0.35314105234688, -0.638945887085246, -1.78366158643001, -1.9106741909914, 0.852599978921996, 1.30133680993357, 0.238539052274575, 0.899835434817951, 0.427480875858397, 0.191303596378619, -0.871494161280378, -0.0921091389971132, -1.03681825691622, -1.46139243422072, -1.06559864995261, 0.25371396427443, 0.451610856408486, 1.50706094779011, 1.04530153281065, -0.867701757818551, -0.274011081416384, 1.37512968636741, 0.583542117831189, 0.385645225697134,
+#> -0.867701757818551, -1.06559864995261, -0.67694488988391, -0.285409032721222, -0.0700643112817441, 0.43893230302975, 0.869621745908706, 0.928352124483109, 0.223587581590272, 0.654277024469228, 0.869621745908706, 0.595546645894825, 0.987082503057512, 0.26274116730654, 0.869621745908706, 0.419355510171615, -2.10605076852772, 0.204010788732137, -1.77324528993944, -0.324562618437491, -2.08647397566958, -1.34750363257344, -0.0757024512681711, 1.62003245713886, 1.14310701414938, 0.984131866486223, 0.136264412282708,
+#> -1.08254505313485, 0.295239559945867, 0.295239559945867, 0.666181571159905, -1.66545392789976, 0.613189855272185, -0.976561621359406, -0.605619610145368, -0.870629146262968, -0.169451310346484, -0.0818040808569232, 0.0496667633774176, -0.169451310346484, -0.914452761007748, 1.23290436148648, 0.794668214038682, 1.36437520572083, -1.39651252320033, 1.49584604995517, 0.750844599293902, 0.48790291082522, -1.17739444947643, -1.39651252320033, -2.6380014011736, -0.406089779868788, -0.527389324504919, 0.855425484346979,
+#> 0.952465120055884, 0.952465120055884, 0.903945302201431, 0.903945302201431, 0.370227305802453, 0.734125939710847, 0.903945302201431, 0.394487214729679, 0.443007032584132, 0.806905666492526, 0.661346212929168, 0.273187670093548, 0.734125939710847, -0.891287958413313, -1.25518659232171, -0.721468595922729, -1.20666677446725, -1.18240686554003, -1.0611073209039, -3.10025376539595, -0.190709616483347, 0.420539154296611, -1.92665612549843, -0.679708633107314, 0.591688810114999, 0.616138760946197, 0.689488613439792,
+#> 0.689488613439792, 0.640588711777396, 0.591688810114999, 0.640588711777396, 0.542788908452602, 0.713938564270991, 0.542788908452602, 0.127139744322231, 0.053789891828636, 0.249389498478223, -0.948658092250495, -0.264059468976942, 0.322954856045637, 1.57889040733423, 0.950922631689932, -0.484432284068456, 0.0538258093409397, -1.74036783535704, -0.125593555128859, 0.412664538280537, 0.861212949455033, 0.950922631689932, -0.125593555128859, 0.412664538280537, -0.305012919598657, -0.574141966303355,
+#> -2.18891624653154, -1.67083537096388, -0.302743106206759, 0.869907406442205, 1.19564365995581, 0.739612905036765, 0.739612905036765, 0.0229931473068423, -0.237595855504039, -1.60568812026116, 1.06534915855037, 0.804760155739485, 0.804760155739485, 0.609318403631324, 0.218434899415003, -1.27995186674756, -0.367890356909479, -1.60568812026116, 0.727449725644841, 0.664873405159263, -0.0651836671724768, 0.518861990692915, -0.00260734668689907, 0.39370934972176, 0.518861990692915, 0.64401463166407, 0.64401463166407,
+#> 0.64401463166407, 0.602297084673685, 0.623155858168878, -0.148618761153247, -1.71302677329269, -1.73388554678788, -2.31793120465327, -1.89979926743713, 0.205469138741121, 0.470998487268108, 0.812393363945663, 0.622729543569243, 0.793426981908021, 0.470998487268108, 0.622729543569243, 0.641695925606885, 0.717561453757453, 0.812393363945663, 0.603763161531601, 0.698595071719811, -0.477320614613989, -0.629051670915124, -0.629051670915124, -2.01359755966299, -1.82393373928657, -1.37703592066508, 0.78459023386731,
+#> 0.928698644169469, -0.296222843398883, -0.584439664003201, -0.800602279456439, 1.28896966992487, 1.00075284932055, -0.944710689758598, -1.14705349999972, -1.08487054162607, 1.13817022023206, 1.1848074390123, 1.30917335575961, 1.16926169941888, -0.0433059888673662, -1.03823332284583, 0.594069334462586, 0.74952673039672, -0.680681312197318, -0.0277602492739527, -0.976050364472174, -1.14705349999972, 0.262099461854204, -0.109534103461458, -0.258187529587723, -2.93394919986049, 0.633733027169865, 0.447916244512034,
+#> 0.708059740232998, 0.856713166359262, 0.485079601043601, 0.968203235953961, 0.931039879422395, 0.819549809827696, -0.741311164498083, 0.522242957575167, -1.37308822553471, 0.29926281838577, -0.0352073903983258, -1.37308822553471, -0.109534103461458, 0.576275391565563, 0.796763367468909, 0.907007355420581, 1.2377393192756, 0.907007355420581, 0.576275391565563, 0.907007355420581, 0.135299439758871, 0.686519379517236, 0.46603140361389, -1.1876284156612, -1.95933633132291, 0.576275391565563, 0.245543427710544,
+#> -0.526164487951166, -0.856896451806185, -0.967140439757858, 0.355787415662217, 0.355787415662217, 0.46603140361389, -1.62860436746789, -2.06958031927459, -1.41319900460827, -1.37369198525987, -1.13664986916949, 0.937468646621328, 1.2535248014085, 0.660919511182552, 1.39179936912789, 1.15475725303751, 0.957222156295527, 1.15475725303751, -0.702072656337132, 1.07574321434072, -0.0502068370885875, -0.682319146662934, 0.996729175643923, -1.35393847558568, -0.109467366111182, -1.33418496591148, -0.642812127314537,
+#> 0.206588788675991, 0.265849317698586, 0.206588788675991, -0.0106998177401908, -1.45270602395667, -1.12200543662319, -1.18932576282059, 0.830284023101164, -0.336601630986958, 0.852724131833628, 0.8078439143687, 0.650763153241453, 0.830284023101164, 0.0673203261973917, 0.561002718311597, 0.426362065916814, 0.673203261973917, 0.224401087324639, 0.628323044508989, -1.88496913352697, -2.01960978592175, -2.06314899124094, 2.10244706726458, -2.53472590352459, 0.451927874271826, 0.5305240263191, 0.766312482460922,
+#> 0.5305240263191, 0.451927874271826, 0.216139418130004, 0.373331722224552, 0.609120178366374, 0.294735570177278, -0.255437494153641, -0.412629798248189, 0.0589471140354555, 0.294735570177278, -0.334033646200915, -1.11999516667365, 0.0589471140354555, -0.0196490380118185, -0.302750253043439, 1.11639155809768, -0.813641305054241, -0.566441184037021, 0.991272072064786, 0.849661776055531, 0.424830888027766, -0.708051480046276, 0.566441184037021, 0.141610296009255, 0.708051480046276, 1.13288236807404,
+#> 0.566441184037021, 0.708051480046276, 0.566441184037021, -0.708051480046276, -0.849661776055531, -2.40737503215734, -1.41610296009255, -1.53173518448872, -0.395090424570502, 0.474108509484602, 0.808415791813489, 0.808415791813489, 1.20958453060815, 1.0758616176766, -0.796259163365166, 0.474108509484602, -0.729397706899388, -1.39801227155716, -2.24339623575453, 1.02319881534946, 0.958726544603987, 0.700837461622092, 0.786800489282724, 1.04468957226462, 0.442948378640198, 0.0990962679976724, 0.700837461622092,
+#> 0.52891140630083, -0.97544157776022, -1.36227520223306, 0.808291246197882, 0.378476107894725, -0.910969307014747, -0.395191141050958, -1.49121974372401, -0.0943205442387483, -1.93881635234564, -1.41949054368163, -0.181098230713603, 0.877527456178417, 1.03732001269042, 0.957423734434419, 0.817605247486416, 0.757683038794415, 0.817605247486416, 1.11721629094642, -0.0412797437656007, -0.980061013273619, -0.340890787225607, -0.52065741330161, -0.960086943709619, 0.752588217412252, 0.730453269841303,
+#> 0.575508636844663, 0.774723164983201, 0.243484423280434, 0.509103794131817, 0.243484423280434, 0, -0.132809685425692, -1.23955706397312, -2.45697918037529, -2.74416375124706, 0.735614991593036, 0.572500363022406, 0.844358077306789, 0.599686134450844, 0.545314591593968, 0.681243448736159, 0.898729620163665, 0.409385734451776, 0.219085334452709, 0.409385734451776, -0.188701236973866, 0.0831564773105171, -0.351815865544495, -2.03733369410767, -0.215887008402304, -0.460558951258248, -0.0911815398476416,
+#> -0.594959547505862, -0.904976782987843, -0.304318389241504, 0.97450270712167, 1.3232720970389, 1.30389601982128, 0.935750552686422, 1.3232720970389, 1.12951132486266, -1.09873755516408, 0.412596467810578, -1.05998540072883, -0.188061925935761, -0.459327006982495, -1.46688302229893, -1.23437009568745, -1.62053705992666, 0.415688865071369, 0.600800312798462, 0.353985049162337, 0.353985049162337, 0.847615576434588, 0.724207944616525, 0.4773926809804, -1.12690653265441, -0.571572189473132, 0.292281233253306,
+#> -0.448164557655069, -1.18861034856344, 0.847615576434588, 1.52635755143393, 1.64976518325199, -0.324756925837007, -1.43542561219957, -1.37372179629054, 0.193572522772324, -0.400862783378906, 1.60040274733023, -0.123459640508332, 0.0350564411319957, -0.916040048709972, -0.163088660918414, -0.856596518094849, 1.60040274733023, -1.1736286813755, 1.58058823712519, -1.03492710994022, -0.341419252763783, -1.59373401051644, -1.3983550600153, 0.907116555898149, 0.96573024104849, 0.496820759845755, 0.907116555898149,
+#> 0.868040765797921, -0.0111645114572079, 0.438207074695413, 0.22329022914416, 0.281903914294502, -0.480073992659943, 1.21972287669997, 0.340517599444843, -1.86726454121803, 0.828964975697693, -0.90990768376245, -1.2615897946645, -1.24205189961439, 1.27833656185031, 0.00837338359290603, -2.57539050116408, -0.119056981805639, -0.0313307846856944, 0.407300200914027, 0.319574003794083, -0.55768796740536, 0.407300200914027, 0.933657383633693, 0.933657383633693, -0.0313307846856944, 0.495026398033971, 0.67047879227386,
+#> 0.758204989393804, -1.61040233284469, -2.35509729158894, -0.323386493770421, 0.553037771955213, 0.453444105395482, 0.752225105074675, 0.712387638450782, 0.632712705202998, 0.652631438514944, 0.533119038643266, 0.752225105074675, 0.612793971891051, 0.632712705202998, 0.453444105395482, -1.65794162567082, -1.25956695943189, 0.174581839028235, -1.31932315936773, -1.13033353389993, -1.31768163344136, -0.418410755642517, -1.2052727737165, -1.24274239362479, -0.0811841764679509, 0.555799361972896, 1.94217529857944,
+#> 1.49253985968002, 1.53000947958831, 0.2935120226149, 0.480860122156325, 0.480860122156325, 0.21857278279833, 0.256042402706615, -1.09286391399165, -0.455880375550802, -0.306001895917661, -1.64406260206083, 0.427906704645971, 1.19363449190718, 0.517992326676701, 1.10354886987645, -0.67564216523048, 0.225214055076827, 0.517992326676701, -0.112607027538413, -1.5539769800301, -2.26677301905432, 0.127705522200243, -0.431006137425821, 0.606601230451156, 0.606601230451156, -0.191558283300365, 0.686417181826308,
+#> 0.846049084576612, 0.606601230451156, 0.3671533763257, 0.606601230451156, 0.606601230451156, 0.446969327700852, -0.351190186050669, -2.26677301905432, -1.45845156052036, 0.503828720907034, 0.804358133377896, 0.751323531177156, 0.698288928976416, 0.822036334111477, 0.698288928976416, 0.274012111370492, 0.963461939980118, 0.592219724574935, -1.79433737445838, -0.433115917972713, -1.38773875758604, -1.03417474291444, -2.02788832064895, -2.08812262720288, -0.863358393939653, 0.662577372093222, 0.762967883016437,
+#> 0.662577372093222, 0.762967883016437, 0.0200781021846431, 0.84328029175501, 0.863358393939653, 0.803124087385723, 0.823202189570367, 0.642499269908579, 0.461796350246791, -0.220859124031074, 0.0200781021846431, -0.963748904862868, -1.1645299267093, -1.9782261040762, -1.88657084056688, 0.588121274184817, 0.886000880590114, 0.427724563043503, 0.450638378920834, 0.0381896931288843, 0.679776537694139, 0.29024166777952, 0.886000880590114, 0.358983115411512, -0.740880046700354, -1.16351339668028, -0.78085739777207,
+#> -1.87142699466047, -1.16351339668028, 0.309712199116334, 0.768899397806189, 0.960227397260295, 0.845430597587831, 0.749766597860778, 0.768899397806189, 0.692368198024546, 0.883696197478652, -0.704326197990428, 0.692368198024546, 0.50104019857044, -1.48877099575226, -1.93135015628533, -1.88984054098606, 0.787529645816644, 0.974322914663344, 0.600736376969943, 1.11960656821078, 0.974322914663344, 0.89130368406481, -0.478513620810991, 0.061111378079476, 0.123375801028376, 0.683755607568477, 0.683755607568477,
+#> 0.39318830047361, -0.769080927905858, 0.102620993378743, -0.914364581453292, -1.41247996504449, 1.07638947518612, -0.267456531181918, 0.56444813942687, 0.244484804577336, 0.713764362356652, 0.436462805487056, 0.94840414124631, -0.523427199061544, 0.927073252256341, -0.0114858633022908, -1.76061876047974, -0.22479475320198, -2.12324387330921, -3.61453996585392, 0.717707216241498, 0.644896339231491, 0.535680023716481, 0.572085462221484, 0.0260038846464314, 0.608490900726488, 0.499274585211477, 0.826923531756509,
+#> -0.0104015538585721, 0.42646370820147, 0.171625638666446, -0.119617869373583, 0.31724739268646, -1.46661909405871, 0.681301777736495, -0.665699446948636, 0.31724739268646, 0.31724739268646, -0.0832124308685792, -0.702104885453639, -2.78384990133893, -0.386846674601643, 0.45915446424681, 0.529654559150848, 0.0831539580919419, 0.811654938766999, 0.882155033671037, 0.905655065305716, 0.647154717324244, -0.457346769505681, 0.224154147900017, -0.104846294985492, -0.80984724402587, -1.03746401937247, -1.53178511095582,
+#> 0.198338709585914, 0.610272952572042, 0.363112406780365, 0.527886103974816, 0.775046649766493, 1.1045940441554, 1.02220719555817, 0.939820346960944, 0.775046649766493, 0.610272952572042, 0.692659801169267, 0.527886103974816, 0.692659801169267, 0.857433498363719, -0.29598238199744, 0.857433498363719, 0.775046649766493, 0.527886103974816, -0.955077170775245, -1.4493982623586, -0.955077170775245, -1.7789456567475, -0.378369230594666, -1.53178511095582, -1.94371935394195, -1.83181162064739, -0.332223495927293,
+#> -0.390649007280024, -0.682776564043679, 0.232556447149105, 0.368882640305477, 0.836286731127324, 0.797336390225504, 0.933662583381876, 1.24526531059644, 1.10893911744007, 0.992088094734607, -1.2865068480219, 0.193606106247285, 0.485733663010939, -1.69548542749101, -0.974904120807333, -1.58945503074132, -1.15252994740098, 0.831838139436428, 0.64978602137795, 0.97747983388321, 0.795427715824732, 0.740812080407189, 0.777222504018884, 0.231066149843452, -0.0238068154384163, 0.558759962348712, -1.31637685365361,
+#> -1.48022375990624, 0.15108536542093, 0.815339989254329, 0.776266187852364, 0.893487592058258, 0.385528173832718, 0.229232968224859, 0.815339989254329, 0.65904478364647, 1.01070899626415, 0.698118585048435, -1.49001429346159, -0.513169258412469, -1.2555714850498, -1.56816189626551, -1.60723569766748, -0.392692501864671, 1.58845885889403, 0.774771692868134, 0.880904801480208, 0.63326088138537, -1.34789047937333, -0.428070204735362, -1.41864588511471, 0.350239258419842, -0.640336421959508, -1.90530340703349,
+#> -0.492777266718703, 0.97943307670798, 0.561643654924732, 1.13859095167303, 0.999327811078611, 0.521854186183471, 1.0590120141905, -1.3283561102852, -0.651935141683749, 0.322906842477162, -0.333619391753656, -0.870777219760689, 0.916807316093934, 0.743480559817469, 0.136836912849841, 0.136836912849841, -2.46306443129714, 0.136836912849841, 0.743480559817469, 0.223500290988074, -0.036489843426624, 0.483490425402771, -0.123153221564857, 1.17679745050863, 0.656817181679237, 0.570153803541004, 0.136836912849841,
+#> 0.136836912849841, 0.223500290988074, -2.20307429688244, -1.59643064991481, -1.59325873498206, 0.476682288189753, 1.20336371121815, 1.24740500958351, -0.20595783647329, -1.37305224315527, 0.234455147180286, 0.586785534103147, 0.89507462266065, 1.29144630794887, 0.806992025929935, -0.448184977482757, 0.322537743911001, 0.124351901266892, -1.46113483988598, -0.822536013588297, -1.28496964642455, -1.23337181038789, -1.34886160775915, -0.655922823531617, 0.941686040104082, 1.19191393440847, 1.21116223397034,
+#> 1.38439693002723, -0.0399772375515885, 0.210250656752798, 0.364237053247805, 0.133257458505295, -1.15637861214039, -1.00239221564538, -1.59612399059436, -1.57947292064777, -1.44626436107507, 0.968140781180184, 0.801630081714304, 0.801630081714304, 0.901536501393832, 0.51856189262231, 0.701723662034777, 0.202191563637139, 0.335400123209842, 0.635119382248425, -0.014272345668504, -1.22980045176942, -1.8903997313955, -0.606354630824972, 0.828754599224443, 0.853931954137591, 0.32520750096149, 0.753222534485,
+#> 0.803577244311296, 0.753222534485, 0.174143371482605, 0.425916920614081, -1.76451295682976, -0.656709340651268, 0.0334432217936152, 0.635421214078689, 0.902966988427611, -0.323284477338281, 0.70230765766592, 0.813785063644637, -0.791489582448894, -1.9731500858233, -2.69919012581242, 0.0688447789345294, -0.113949978926118, 0.277753073632413, 0.46054783149306, 0.382207220981354, 0.721683199865414, 0.591115515679237, 0.512774905167531, 0.643342589353708, -0.845129010368709, -2.24753842584837, 0.867861372357291,
+#> 0.244781412716159, 0.155769989910283, 0.600827103939663, 0.422804258327911, 0.511815681133787, -0.556321392536725, -2.06557844295738, -0.145040617059962, -0.945264711183887, 0.335093839414394, 1.2953627523631, 0.735205886476357, 0.815228295888749, 0.895250705301142, 0.975273114713534, 1.05529552412593, 0.655183477063964, 0.0950266111772162, -0.865242301771495, -0.705197482946709, -1.10530953000867, -1.02528712059628, -0.843492191568975, 0.29729642817595, 0.75361187607392, 0.829664450723582, 1.13387474932223,
+#> 0.601506726774597, 0.145191278876627, -1.75612308736491, 0.601506726774597, -0.0829664450723581, -1.68007051271525, -1.41312729398537, -0.920427739377443, 0.349221112881442, 0.00812142122980101, 1.14512039340194, 1.14512039340194, 1.08827044479333, 0.709270787402618, 0.0649713698384078, 1.05037047905426, 0.349221112881442, -1.45102725972444, -0.80672784216023, -1.31837737963769, -1.73394332193633, -2.31572693653339, 0.884082943750433, -0.279484285443685, 0.787119007984256, 0.981046879516609, 0.884082943750433,
+#> 0.69015507221808, 0.787119007984256, 0.496227200685727, 0.69015507221808, 0.108371457621021, -1.15215970733927, 0.108371457621021, -1.0551957715731, 0.302299329153374, -0.182520349677509, -2.26946201782415, -1.60149498810038, 0.955206401531954, 0.678806251301431, 0.586672867891257, 0.701839597153975, 0.655772905448887, 0.333306063513278, 0.817006326416692, 0.563639522038713, 0.54060617618617, 0.770939634711605, -0.242527582800312, -0.42679434962066, 0.172072642545473, -0.449827695473204, -1.78576175492073,
+#> -0.946957510490171, 0.77817801729555, 0.75577365979184, 0.710964944784418, 0.666156229776997, 0.822986732302972, 0.598943157265865, 0.486921369747312, -0.543679075423379, 0.77817801729555, -2.17919717319426, 0.150856007191652, 0.509325727251022, -0.834935722971617, -1.75351438062375, -2.42363459036239, 0.0036155662710529, 0.667674571387751, 0.644775985004416, 0.667674571387751, 0.324195775637735, 0.576080225854413, 0.347094362021069, 0.736370330537754, 0.0265141526543873, 0.415790121171072, 0.690573157771085,
+#> 0.484485880321075, 0.553181639471079, 0.576080225854413, -0.683342025228979, -1.96566286269571, 0.3012971892544, -1.94276427631237, -1.80122424696303, -1.47292951033185, 1.29412612698809, 0.356141165184717, 0.637536653725728, 1.43482387125859, 1.08307951058233, 0.449939661365054, 0.238893044959296, 0.238893044959296, -1.44947988628677, 0.520288533500306, 0.26234266900438, -0.581843796618653, -1.00393702943017, -0.206649811897305, -0.212063868231168, 0.00359430285137584, 0.736832084532026, -2.23925067640708,
+#> -0.233629685339423, 0.629002998990754, 0.758397901640281, 0.779963718748535, 0.887792804289807, 0.6074371818825, 0.80152953585679, -0.298327136664186, 0.779963718748535, 0.21925247393392, 0.305515742366938, -0.427722039313713, -0.51398530774673, -2.58430375013916, -1.91332108831656, 0.996172181151048, 1.12548299312739, 0.715998755202316, 0.414273527257527, 0.263410913285133, -0.814179186517683, -0.814179186517683, 0.0263410913285134, -1.62438722435997, -1.02873185735998, 0.0434478032399993, 0.829712887679985,
+#> 1.16327989319998, 0.948843961079982, 1.06797503447998, 0.0672740179199988, -0.218640558239996, -2.00560665923996, 0.186405091319997, 0.710581814279987, 0.758234243639986, 0.877365317039984, 0.305536164719994, -1.05255807203998, -1.02873185735998, -1.66631976023865, -1.49091768021353, 0.806849568115559, 0.929631024133144, 0.701608320100486, 0.824389776118071, 0.947171232135656, 0.877010400125608, 0.719148528102998, 0.719148528102998, 0.841929984120583, 0.701608320100486, -0.841929984120583, -0.561286656080389,
+#> -0.105241248015073, -0.98225164814068, -0.719148528102998, -1.70140017624368, -1.24346205855786, 0.425183800668173, 0.711982307722648, 1.62452301198689, 0.60769194152102, 0.425183800668173, 0.0340949274120704, 0.373038617567359, 0.190530476714511, 0.738054899273055, -0.748082819100134, -1.13917169235624, -1.99956721351966, -0.11726883765588, 0.5066013786734, -1.89975517002525, -0.295517470892817, 1.21959591162115, 0.684850011910337, 0.5066013786734, 0.684850011910337, -0.384641787511285, 0.773974328528806,
+#> 0.863098645147275, 0.773974328528806, 0.684850011910337, -0.652014737366691, 0.595725695291869, -0.741139053985159, 0.5066013786734, -1.45413358693291, -2.25625243649912, -2.06616282684876, -1.69068649284292, 0.224242810586816, 0.580945327892356, 0.806231128295855, 0.712362044794397, 0.599719144592647, 0.618492961292939, 0.618492961292939, 0.693588228094105, 0.580945327892356, 0.618492961292939, 0.656040594693522, 0.618492961292939, 0.167921360485941, -0.695674207727471, -1.67191267614263, -1.37153160893797,
+#> -1.92087556764292, 0.415766072769592, 0.392163631957344, 0.62818804007982, 0.580983158455325, 0.887814889014543, 0.935019770639038, 0.510175836018582, 0.0617294605858782, 0.958622211451286, -0.622741322969301, -1.30721210652448, -1.51963407383471, -0.359679094130247, -0.228318033665287, 0.384700248504525, -0.972697376300059, 0.910144490364364, 2.35511615547892, 1.4355887322242, -0.622401215060166, -0.0969569732003274, -0.885123335990086, -0.885123335990086, 0.0344040872646323, -1.14784545692, 0.0781911074196188,
+#> -0.946129469701382, -1.95533423738286, -0.273326291247066, -0.105125496633487, 0.00700836644223246, -0.273326291247066, -1.17039719585282, 1.296547791813, 0.848012339510128, 0.623744613358689, 1.35261472335086, 1.18441392873729, 1.01621313412371, -0.161192428171347, -1.28253105892854, -0.161192428171347, -2.34633833079478, -2.30459191488092, 0.763769654787625, 0.0332073762951142, 0.262812663821332, -2.30459191488092, 0.555037575218336, 0.492417951347549, 0.826389278658411, 0.596783991132194, 0.763769654787625,
+#> 0.596783991132194, 0.534164367261407, 0.429798327476763, 0.680276822959909, 0.241939455864403, 0.137573416079759, 0.429798327476763, -0.63473527832661, 0.283685871778261, 0.054080584252043, -0.0920318714464591, -1.72518769487231, -1.29225085889675, -0.760919287472198, -0.426377186945628, 1.10858068605863, 1.06922279187904, 1.06922279187904, 0.47885437918509, 0.852754373891256, 0.754359638442265, 0.931470162250448, 0.577249114634081, -0.898671917100785, -0.741240340382399, -0.997066652549776, -1.65781586807415,
+#> 0.0466484984523028, 1.30256961062969, 1.57169556323913, 0.405483101931555, 0.943735007150434, 0.674609054540995, 0.764317705410808, 0.854026356280621, 0.584900403671181, 0.854026356280621, 0.854026356280621, 0.495191752801368, -1.47839856633452, -0.850438010245828, 0.0466484984523028, 0.226065800191929, 0.495191752801368, 0.0466484984523028, -1.92694182068359, -0.671020708506202, -0.671020708506202, 0.0466484984523028, -1.56810721720433, -1.38868991546471, -1.2561975285376, 0.947296496929997, 1.02967010535869,
+#> 0.700175671643911, 0.288307629500434, 0.432461444250651, -0.617802063215215, -1.52391175593087, -2.25435399374905, -1.9894605012155, 0.593251050986592, 0.681548881831108, -1.1506311081926, -0.554620749992117, 0.659474424119979, 1.0568146629203, 1.16718695147595, -0.289727257458568, 0.593251050986592, -0.179354968902923, 0.681548881831108, 0.747772254964495, -0.0469082226361492, 1.07888912063143, 0.460804304719818, 0.681548881831108, -0.620844123125504, -0.0248337649250201, 0.725697797253366, 0.659474424119979,
+#> -0.92988653108131, -1.74664146639308, -1.74827249146376, -0.912484180021578, 0.608650546803186, 0.39134558582822, 0.759092442862778, 0.825955507778152, 0.00688296256481785, -0.528021556758176, 0.708945144176247, 0.825955507778152, 0.842671274006996, 0.792523975320465, 0.892818572693526, 0.742376676633934, -1.06292607608117, -1.34709410197151, -1.79841979015029, -0.515185750528226, 1.19053287427766, 0.662000342647669, 0.662000342647669, 1.16650866829448, 0.469806694782217, 0.926266608462666, 0.710048754614032,
+#> -1.47615398985549, 0.493830900765398, 0.613951930681306, -0.707379398393679, 0.637976136664488, -0.322992102662774, -0.0347016308645955, -0.683355192410497, -2.00468652148548, -1.78846866763685, 0.337560150271881, 0.706089121669624, 0.521824635970753, -0.267880302738695, 0.785059615540569, 0.100648668659047, 0.627118627798679, 0.574471631884716, 0.627118627798679, 0.390207146185845, 0.390207146185845, -0.768026763921346, 0.258589656400937, 0.390207146185845, 0.0216781747881022, -1.58405520058778,
+#> -3.11081808209271, -2.16000835287589, 0.637640842177385, 0.74125747903121, 0.637640842177385, 0.53402420532356, 0.74125747903121, -0.191292252653216, 0.74125747903121, -1.53830853175294, 0.74125747903121, -1.12384198433764, 0.53402420532356, -0.294908889507041, -1.86990134452422, -0.690494543150938, -1.484788919586, 0.22414746607732, 0.729607523808725, 1.21099805498149, 0.561120837898257, 1.47576284712651, 0.705537997250087, 0.80181610348464, -0.786772649385491, 0.874024683160555, -0.160964958860894,
+#> 0.176008412960043, -1.14781554776507, -0.618285963475023, -0.88138826661267, -0.556666273650108, -0.533471845581353, 1.39166568412527, -0.347916421031317, 2.13388738232541, 0.811804982406407, -0.301527564893808, -0.742221698200143, -0.139166568412527, -0.834999410475161, 1.07235616580128, 0.934045571552205, 0.993321540516095, 0.756217664660535, 0.756217664660535, 0.835252289945722, 0.716700352017942, -1.91120093871451, 0.934045571552205, 0.202975287664229, 0.499355132483679, -0.132921869797814, 1.05259750947999,
+#> -0.290991120368187, -1.79264900078673, -1.53578646860988, -1.27892393643302, 0.0646646934151525, -0.152680526119111, 0.163457975021636, -0.409543058295967, -1.47651049964599, -1.23047719312809, -0.0506491822837229, 1.12917882856065, 0.700150460980877, 0.0029793636637485, 0.485636277190991, 0.0566079096112199, 0.861036098823291, -0.0506491822837229, 0.753779006928348, 1.18280737450812, 0.485636277190991, 0.914664644770762, -2.14216247423511, -0.0506491822837229, -0.104277728231194, -2.08853392828764,
+#> -0.855077371495794, -1.31173431872287, -0.983800739042153, 1.22975092380269, -0.0409916974600897, -1.35272601618296, 0.614875461901346, 1.14776752888251, 0.901817344121974, 0.737850554281615, 0.901817344121974, 0.409916974600897, 0.573883764441256, 0.532892066981166, -0.573883764441256, -1.43470941110314, 0.327933579680718, -1.68065959586368, -1.1515643861268, 0.643384150953436, 0.596762111029274, 0.713317210839679, 0.993049450384651, 0.433584971294707, 0.713317210839679, 0.410273951332626, 0.759939250763841,
+#> 0.806561290688003, 0.410273951332626, 0.480207011218869, 0.759939250763841, 0.783250270725922, -0.428922767302291, -0.731966026809344, -2.52691456388958, -0.918454186505992, -1.43129662567177, -1.31474152586137, -1.88114076046163, -2.37214612584246, 0.317709354069954, 0.936803075637098, 0.894106956908329, 0.680626363264487, 0.552538007078181, -1.41148345444517, 0.552538007078181, 0.744670541357639, 0.680626363264487, -0.386776604954727, 0.573886066442565, 0.0401845823329585, -0.0452076551245786,
+#> 0.552538007078181, -0.429472723683495, -1.78975387306155, -0.137299516399155, -0.890624296642307, 0.76183006002009, 1.36935004408715, 1.19924444854837, 1.51515484026324, 1.05343965237228, -1.52244508007205, -0.380307510025978, 0.348716470854491, 0.202911674678397, 0.907634856196184, 0.105708477227668, 0.931935655558867, -0.599014704290119, -1.06072989218108, -1.23083548771986, -0.550413105564755, -0.234502713849884, -1.86030934005947, 0.895476161205099, 0.95096177532452, 0.969456980030993, 0.766009728259783,
+#> 0.470086452956205, 0.932466570618046, -0.0847696882380041, -1.04652033297463, -0.491664191780424, -0.140255302357425, -1.36093881298468, -1.5985729343825, -1.80221279863505, -0.682193545246036, 0.132365911764156, 0.23418584389043, 0.539645640269252, -0.631283579182899, 1.45602502940572, 1.1505652330269, -0.0203639864252547, 0.997835334837486, 0.437825708142978, 0.743285504521801, 0.336005776016704, -1.29311313800368, -2.23203469933111, 0.0716857859639188, -0.293260033488759, 0.162922240827088, 0.596295401427144,
+#> 0.596295401427144, -1.6846159701521, 0.93843210716403, 1.21214147175354, -0.133596237478213, 0.984050334595615, 0.391013377985012, 0.27696780940605, -0.886296990099362, -2.24189966373504, 0.639596891662151, 0.774667042696394, -0.0807772471871455, 0.819690426374475, 0.639596891662151, 0.211874746720381, 0.819690426374475, 0.797178734535435, -0.418452624772753, 0.954760577408718, 0.279409822237503, 0.61708519982311, -0.508499392128915, 0.0768045956861381, -1.70161905959806, -1.67910736775902, -1.62931883578239,
+#> -1.61256491459182, -0.858638461016424, -0.925654145778681, 0.799999736849449, 0.850261500421142, 0.414659549466468, 0.917277185183399, 1.00104679113622, 0.867015421611706, 0.850261500421142, 0.598952682562676, 0.799999736849449, -0.121465928631592, -0.540313958395701, -1.41151786030505, -2.20053236104153, -1.51279137354293, 0.684159003188713, 0.684159003188713, 0.550431588952874, 0.512223756314063, 0.493119839994657, 0.684159003188713, 0.378496342078223, 0.645951170549902, 0.607743337911091, 0.626847254230496,
+#> 0.493119839994657, 0.0728336809677338, -0.920569967641357, -1.79935011833402, -1.83039046029113, 0.55137687939634, -1.1389096197367, 0.628208083902388, 0.935532901926577, 1.01236410643262, 0.244052061372151, 1.01236410643262, 1.08919531093867, 0.935532901926577, 0.935532901926577, -1.06207841523066, -0.447428779182276, -0.677922392700418, -0.293766370170181, -1.67672805127903, -0.216935165664134, -2.37550944082286, -2.37550944082286, -0.714711672455578, 0.0617652062615931, 0.838242084978764, 0.816673282792176,
+#> 0.730398074045824, -1.68530777085204, -0.650005265895814, 0.471572447806767, 0.795104480605588, 0.816673282792176, 0.687260469672648, -0.434317244029933, 0.406866041247002, 0.428434843433591, 0.191178019381122, 0.622554063112883, 0.622554063112883, 0.600985260926295, 0.471572447806767, -0.326473233096992, -1.63323520404328, -0.643395686441291, 0.544411734681092, 0.0824866264668321, 0.610401035854558, 1.07232614406882, 1.00633684289535, -1.03933149348208, -0.718317053633575, -1.24542740953735, -0.935362494299835,
+#> 0.242884183602719, 1.26609840388652, 1.20408542083901, -1.1524079349661, 0.863014014077748, 0.987039980172754, 1.04905296322026, 0.987039980172754, 0.273890675126471, -1.2144209180136, 0.987039980172754, 0.304897166650222, -0.997375477347338, -1.40045986715611, -0.501271612967315, -0.175828488781527, -0.674009206995853, -1.20332622009857, -0.580600322330667, 0.727124062981939, 0.695987768093544, 1.53666773008022, 1.97257585851775, 0.478033703874776, -0.580600322330667, -0.393782553000295, -1.20332622009857,
+#> -0.954235860991411, 0.353488524321195, 1.47439514030343, -0.767418091661039, -0.705145501884248, -2.26147498625255, -1.67597662717442, -0.788285566636605, -0.504979909018153, -0.165013119876011, 0.628242721455654, 0.703790896820575, 0.741564984503035, 0.741564984503035, 0.741564984503035, 0.741564984503035, 0.760452028344265, -0.240561295240931, 0.741564984503035, -0.429431733653232, 0.722677940661805, 0.741564984503035, 0.609355677614424, -1.80818593406303, -2.08141439615195, 0.500127840771494,
+#> 0.566321231461839, 0.720772476405977, 0.323612132263908, -0.691353191654712, 0.632514622152183, 0.610450158588735, 0.80903033065977, -1.79457636982712, 0.566321231461839, -0.161806066131954, -0.297133451984607, -0.551819267971412, 0.339581087982407, 0.594266903969212, 0.97629562794942, 1.10363853594282, 0.466923995975809, 0.594266903969212, 0.339581087982407, 0.848952719956018, 0.594266903969212, 0.212238179989004, -1.57056253191863, -1.69790543991204, -1.95259125589884, -1.63461958604583, -1.2118731413788,
+#> -0.166131936149848, 0.412363198657658, 0.835109643324682, 1.07985758497401, 1.03535795921959, 1.0576077720968, 1.0576077720968, 0.456862824412082, 0.479112637289294, 0.034116379745058, -0.94487538685226, -1.07837426411553, -1.41212145727371, -0.033235182692676, 1.00370251731881, 0.684644763469123, 0.764409201931545, -0.272528498079942, 0.365587009619435, 0.764409201931545, 1.16323139424366, -0.033235182692676, -1.07017288270416, -1.86781726732838, -1.46899507501627, -1.11525757659791, -0.0352805560259444,
+#> -0.444927012104967, -1.56214461959321, 1.0819370514623, 0.337125313136803, 0.7840123561321, 0.932974703797199, 0.821252943048375, 0.672290595383276, 0.932974703797199, -0.929054642016538, 0.597809421550726, 0.448847073885627, 0.858493529964649, 0.895734116880924, -1.52490403267693, -1.00353581584909, -1.74834755417458, 0.257150031225363, -1.07725013080895, 1.59155019325968, 0.340550041352508, 0.284950034601078, 0.701950085236801, -1.46645017806896, -0.632450076797514, -2.0280358783822, -0.948453690768825,
+#> -1.70212427457439, 0.925538031126088, 0.945907506364076, 0.945907506364076, 1.06812435779201, 0.986646456840053, 0.966276981602065, 0.212606397796502, -0.133674681249297, -0.337369433629179, 0.151497972082537, 0.314453773986443, -0.968823166006813, -0.398477859343144, 0.0898473416274134, 0.53179913017307, 0.72120703954978, 0.784343009342016, 0.563367115069188, -0.888760190152254, -2.40402346516593, 1.00531890361484, -1.07816809952896, 1.00531890361484, 0.184551296315768, 0.15298331141965, -0.667784295879426,
+#> -1.10950825597532, 1.36858124975636, 0.602626311621113, -0.388609490671559, -0.0957443672669058, -1.04192399672809, 0.737794830115568, 1.3911093361721, 1.07571612635171, -0.704002700491954, -1.40237337937997, -0.433665663503044, -2.84150105939604, -0.0366645297986582, 0.670437116318328, 0.576156896836063, 0.623297006577196, 0.481876677353798, 0.269746183518702, 0.623297006577196, 0.387596457871533, -0.743766175915644, 0.340456348130401, 0.481876677353798, 0.4111665127421, 0.576156896836063, 0.623297006577196,
+#> 0.316886293259835, -0.602345846692247, -2.15796946814962, 0.902155659373064, 0.612177054574579, -0.0402748062220119, 1.55460752016966, 0.539682403374958, -0.692726667018603, -0.475242713419739, -0.692726667018603, -1.7076517838133, -2.13414008769764, -1.93044096038436, -0.178628465490111, 0.758387520150998, 0.717647694688341, 0.880606996538969, 0.595428218300371, 0.575058305569042, 0.656537956494356, 0.4732087419124, -0.361957680072067, 0.391729090987086, -0.443437330997381, 0.364962855484165, 1.41605587927856,
+#> 0.832115310503896, 1.18247965176869, -1.27007073708489, -0.569342054555297, -0.160583656413032, 0.481750969239097, -1.27007073708489, -1.73722319210462, -1.03649450957503, 1.00729748113629, 1.00729748113629, -0.802918282065162, 0.423356912361631, 0.131386627974299, -2.87403107145145, 0.232276218059115, -0.557462923341876, -0.399515095061678, 0.495522598526112, 0.337574770245914, 1.07466463555351, 1.07466463555351, 0.758768978993109, 1.1799631877403, 0.600821150712911, -0.0836194385012813, 0.548171874619512,
+#> -0.452164371155077, -0.294216542874879, -1.18925423646267, -0.452164371155077, -1.90567593819644, 0.664584465841616, 0.712626716384384, 1.00088021964099, 0.952837969098221, 0.520457714213314, -0.368323920827884, -0.752661925170023, 0.88077459328407, -0.440387296642035, 1.28913372289759, 0.712626716384384, 0.0640563340570234, -1.59340130966845, 0.232204210956709, 0.256225336228093, -0.320281670285116, -1.90567593819644, -1.00731945836528, 0.978810417090787, 1.43020357060353, 0.2565813714704, 0.346860002172949,
+#> 0.707974524983142, -1.09759808906782, -0.826762196960179, 1.15936767849588, 0.437138632875497, 0.707974524983142, 0.437138632875497, 0.707974524983142, 0.166302740767852, 0.166302740767852, -0.0142545206372446, -0.465647674149986, -1.91010576539076, -2.1809416574984, -2.45458216335431, 0.926066607834085, 0.588001730715246, 0.509986759072437, 1.0560915605721, 0.978076588929291, 0.0158919386679797, -0.868277739950523, 0.744031674000864, 0.197926872501201, 0.848051636191276, 0.379961806334422, 0.0679019197631857,
+#> 0.0418969292155827, -0.582222843926889, -2.14252227678307, 0.197926872501201, -0.50420787228408, -1.74806068758539, 0.428769602615285, 0.549704618737544, 0.670639634859804, 0.566981049612153, 0.60153391136137, 0.48059889523911, 0.636086773110587, 0.497875326113719, -0.69419840423427, -1.98993071982991, 0.351372573395818, 0.776939355516649, 0.575355090301518, -0.230981970559004, -2.06763860918575, 0.821735858897789, 0.664948097063799, 1.02332012411292, 0.866532362278929, 0.754541103826079, -0.342973229011854,
+#> 0.216983063252397, -0.275778473940144, -0.723743507751545, -0.0965924604155834, -2.31401937778202, 0.788711209599989, 0.00710550639279262, -0.461857915531525, 1.10135349088287, 0.945032350241428, 0.163426647034232, -1.63426647034232, 0.710550639279269, 0.866871779920709, -1.32162418905944, -1.165303048418, -1.13268811077416, 1.04384982757618, 1.27705032097086, 0.344248347392146, 1.19931682317264, 0.188781351795693, 0.0333143561992398, 0.344248347392146, 0.810649334181504, -1.21042160857238, 0.732915836383278,
+#> -0.821754119581251, -1.44362210196706, -1.36588860416884, -2.74376417705887, -2.308345260578, -0.612503164810409, 0.785420724943959, 0.8083375100219, 0.625003229398376, 0.854171080177781, 0.739587154788078, 0.785420724943959, 0.8083375100219, 0.8083375100219, 0.83125429509984, 0.510419304008674, -0.772920660355992, -0.452085669264826, -0.0166667527839568, 0.143750742761626, 0.0291668173719241, 0.32708502338515, 0.075000387527805, -0.245834603563361, -0.979171726057456, -2.67782520772375, 0.33767297340798,
+#> 0.56383533699286, 0.739739397558878, 0.815126852087171, 0.689481094540015, -0.164910056780642, -0.566976480931539, 0.362802124917411, 0.614093640011722, 0.714610246049447, 0.237156367370256, 0.664351943030584, -0.566976480931539, 0.1115106098231, -1.87369235942196, -3.06094483186302, 0.00606427901310155, -0.277440764849397, -0.225894393238034, 0.882352596406279, 0.624620738349462, 0.727713481572189, 0.830806224794915, 0.315342508681282, 0.573074366738099, 0.856579410600597, -0.612492180323259, 0.90812578221196,
+#> 0.2895693228756, -0.999089967408484, -0.0197089067925801, -0.818677666768712, -1.11404860507903, 1.32000717072389, 0.758301991692448, 0.758301991692448, -0.365108366370438, 0.5710669320153, 0.851919521531021, -0.645960955886159, -1.76937131394904, -0.365108366370438, -2.36324742485749, -1.9464489372283, 0.596021837309737, 0.82526100550579, -0.758573247485121, 0.82526100550579, 0.575181912928278, 0.575181912928278, 0.700221459217034, 0.325102820350766, -0.320934835474474, -0.362614684237393, 0.783581156742872,
+#> 0.470982291020981, 0.0750237277732536, -2.33751891029327, 0.216588290639061, 0.666111158003151, 0.502648297143482, 0.441349724321106, 0.809141161255362, 0.584379727573317, 0.747842588432986, 0.0531254297793923, 0.727409730825527, 0.298319721068896, 0.359618293891272, 0.911305449292655, -0.335098864762322, 0.850006876470279, 0.788708303647903, -1.84713032771426, -0.559860298444367, -1.70410032446205, -1.17284602666813, -1.57757105186519, -1.14504796405222, 0.562280014156858, 0.33463628372898, 0.812688117627523,
+#> 0.562280014156858, 0.789923744584735, 0.357400656771768, -1.28163420230895, -1.14504796405222, 0.471222521985707, 0.74439499849916, 0.835452490670311, 0.880981236755886, 0.676101879370797, -0.507645518854167, 0.471222521985707, 0.767159371541948, -0.0978868040839873, -2.51091034661949, -0.499854794261923, -1.48528281723543, -0.302769189667222, 1.20822044555882, -0.828330801919759, 1.86517246087449, 1.27391564709039, -0.499854794261923, 1.33961084862195, -0.762635600388192, 0.814049236369418, 0.879744437900985,
+#> 1.20822044555882, 0.419878027180016, 0.0914020195221802, -0.237073988135655, 0.157097221053747, -2.1422348325511, -0.828330801919759, 0.0257068179906131, -0.894026003451326, -0.302769189667222, -0.499854794261923, -1.07604121083293, -1.69683421708269, -1.53128941541609, 0.082772400833302, 0.993268809999624, 0.951882609582973, 1.07604121083293, 0.951882609582973, 0.662179206666416, 0.662179206666416, 0.124158601249953, -0.744951607499718, -0.455248204583161, -1.62161161434685, -1.62161161434685, 0.0929471320410269,
+#> -1.13431597063661, -0.719212274142702, -1.47722771991418, 0.129043105649193, 0.634386736163513, 0.814866604204342, 1.0675384194615, 1.0675384194615, 0.399762907710436, 0.814866604204342, 0.165139079257358, 0.941202511832922, 1.04949043265742, 0.850962577812507, 0.544146802143099, -1.51332369352235, -0.484588445689625, -1.36917550892324, -0.473542260219101, 1.10810794493926, -1.59784782774131, 0.784155493280322, 1.0128278120984, 0.993771785530226, 1.12716397150744, 1.10810794493926, 0.95565973239388,
+#> 0.517371121325899, -0.0924217288556393, 0.631707280734938, 0.0981385368260914, -0.930886897855255, -0.225813914832851, -1.40728756205958, 0.326810855644168, -1.06427908383247, -1.50256769490045, 0.399093378907227, 0.952446255335333, 0.591563944621351, 0.80809333104974, 0.80809333104974, 0.832152151764006, 0.856210972478271, -0.322671242520737, 0.567505123907086, 0.375034558192962, -0.130200676806613, -0.00990657323528566, 0.591563944621351, -1.30908289180562, -2.19925925823344, -1.86243576823373,
+#> -0.948200581091639, -3.21138737003437, -0.323140492265258, 0.077210560098778, -0.0657719586026633, 0.448965108722525, -1.63857966431852, 0.477561612462814, 0.620544131164255, 0.506158116203102, -0.637702033408429, 0.906509168567138, -0.12296496608324, 0.906509168567138, 0.820719657346273, 0.620544131164255, 0.677737138644832, 0.53475461994339, 0.448965108722525, -0.208754477304105, -0.837877559590447, 0.280189213988945, 0.845050669390659, -1.35163276828267, 1.15886258905828, 1.03333782119123, 0.907813053324183,
+#> -0.253291049446006, 1.28438735692533, -1.91649422368439, -0.0963850896121971, 0.248808022022184, -1.00643965664829, -0.692627736980673, -0.441578201246578, -2.04630966300896, -0.210497284053198, 1.14220657412473, 0.659098053346901, 0.369232940880201, -0.210497284053198, 0.562476349191334, 1.04558486996917, 1.04558486996917, 0.175989532569068, 0.852341461658034, -0.500362396519898, 0.369232940880201, 0.369232940880201, 0.562476349191334, 0.948963165813601, 0.852341461658034, -0.693605804831031, -1.9496879588534,
+#> 0.272611236724634, 0.659098053346901, 0.465854645035768, -1.46657943807556, -1.56320114223113, -1.36995773392, 0.562476349191334, 0.755719757502467, -1.6598228463867, 0.691235282463302, 1.21489837523853, 0.48177004535321, 1.00543313812844, 0.900700519573393, 0.795967901018348, 0.167572189688073, 0.167572189688073, 0.900700519573393, 0.377037426798165, 0.377037426798165, 0.167572189688073, 0.272304808243119, 0.167572189688073, 0.0628395711330276, -0.879753995862384, -0.460823521642201, -2.55547589274312,
+#> -0.0418930474220181, 0.167572189688073, -2.76494112985321, -0.25135828453211, 0.272304808243119, 0.377037426798165, -1.6128823257477, -0.858856454014377, 0.75149939726258, 0.015336722393114, 1.44165190495271, 1.02756040033863, -0.812846286835036, -0.260724280682936, -1.08890728991109, -0.766836119655694, 0.705489230083239, 1.62569257367007, 0.47543839418653, 0.153367223931139, -0.582795450938327, -1.82506996478055, -1.12591085926502, 1.16252584655819, 1.75751939007222, -0.439379847518056, 0.384457366578299,
+#> -1.12591085926502, -0.48514858163452, 0.842144707742941, -0.851298454566234, -0.118998708702807, 1.69904851533983, -0.0707936881391595, -0.778730569530753, -0.690238459356804, -0.159285798313109, -0.749509361018083, -0.955481399160457, 1.55051173157176, -0.50920864985198, 0.898266944120909, -0.234579265662148, 0.74056603246304, -0.953849049812395, -0.497660373815163, -0.367320752101668, -1.27969810409613, 0.0888679238955648, -0.171811319531425, 0.610226410749545, 0.870905654176535, 2.04396224959799,
+#> -1.08418867152589, -3.55230290366507, 0.125512756661954, 0.922372816399477, 0.922372816399477, 0.309403539678306, -0.0277295625183385, 0.769130497219184, -0.364862664714983, -1.22301965212462, 0.462645858858599, -0.180971881698631, -0.763292694583744, 0.799778961055243, -0.150323417862573, -0.4261595923871, 0.86107588872736, -0.150323417862573, 0.401348931186481, 0.0642158289898372, 0.707833569547067, 0.493294322694657, -2.12377383283214, -0.909327353750958, -0.24481890293295, -1.11555411434965,
+#> -0.0844203113561898, 0.877971238104373, 0.373861378863126, 0.900885322615338, 1.19876842125789, 1.0612839141921, -0.198990733911019, 0.328033209841194, -0.198990733911019, 1.130026167725, 1.08419799870306, -0.0844203113561898, 0.0530641957096048, 0.0530641957096048, -2.10085974832118, -2.44243340315969, 1.1520069799181, 0.638515496621272, 0.741213793280638, 0.330420606643176, 0.535817199961907, -1.00465724992858, 0.433118903302541, -0.388467469972383, 0.22772230998381, 0.125024013324445, 0.741213793280638,
+#> -0.799260656609844, -1.5181487332254, 0.433118903302541, 0.638515496621272, 0.433118903302541, 0.535817199961907, 0.638515496621272, 0.535817199961907, 0.433118903302541, -2.54513169981906, 0.125024013324445, -1.61891626740215, -0.276136219523444, -0.730948816385587, -1.33736561220178, 0.568515746077679, 1.36985222626336, 0.980012857524379, 1.0016706002321, 1.06664382835526, -0.384424933062049, -0.730948816385587, 1.19659028460159, 0.157018634630978, -1.57560078198671, 0.0920454065078146, 0.221991862754141,
+#> -1.25593843259806, -1.08529462382115, 1.30371869905559, 1.11601050940099, 1.0989461285233, 1.04775298589023, -1.03410148118808, 0.911237938868701, 0.365177750782588, -0.368590626958126, 0.928302319746392, 1.32078307993329, 0.467564036048734, -0.744007006267329, -1.15355214733191, 0.791787272724864, -0.948779576799621, -0.897586434166548, -1.08529462382115, -0.778135768022711, -2.78260659734739, 0.697071346580392, 0.724045594207739, -0.597692539532271, 0.0496894035240604, 0.346406127424879, 0.346406127424879,
+#> -0.00425909173063388, 0.589174356071003, -1.16415173970656, 0.643122851325697, 0.61614860369835, 0.535225860816309, 0.831942584717127, 0.670097098953045, 0.23850913691549, 0.0766636511514075, 0.319431879797532, -2.13522465429106, -1.56377082250765, -0.162745379717991, 0.815748580325583, 1.17156456579597, 1.30499556034737, 1.39394955671497, -0.00707588607469515, 1.12708756761217, 0.126355108476701, 0.704556084866086, 0.504409593038991, 0.54888659122279, 0.704556084866086, -0.340653372453186, -0.807661853383074,
+#> 0.593363589406589, -0.58527686246408, -1.56377082250765, 0.237547603936198, -1.09676234157777, -1.65272481887525, -1.45257832704816, -2.61606277966625, -1.00846801321416, -0.606569321601136, 0.766584541410024, 0.766584541410024, 0.465160522700257, -0.0707043994504392, 0.833567656678861, -1.17592580138625, 0.532143637969094, 0.565635195603513, -0.00372128418160216, 0.666109868506768, 0.733092983775606, 0.833567656678861, 0.699601426141187, 0.197228061624909, -1.57782449299927, -1.69407998443941, -1.26636672104134,
+#> 0.570284351197424, -0.134184553222923, 1.55150889664005, 0.997997614595492, 1.09863602951268, -0.536738212891693, -0.335461383057308, -0.637376627808885, 0.721241973573213, 0.21804989898725, 0.670922766114616, 1.22443404815917, 0.746401577302511, -0.662536231538183, -1.11540909866555, -1.41732434341713, -0.0781969157651788, 0.170611452578572, 0.966798231278576, 1.21560659962233, 0.469181494591073, 0.568704841928574, -1.96914051517769, -0.127958589433929, -0.700217836624556, 0.817513210272325, -0.0781969157651788,
+#> 0.643347352431699, 0.220373126247322, -2.11842553618394, -1.84966021880587, -1.90442937853155, -1.72186551277929, -1.42976332757566, 0.35936255679657, 0.943566927203828, 0.76100306145156, 0.633208355424972, 0.0855167581681678, 0.834028607752467, 0.76100306145156, 0.797515834602014, 0.834028607752467, -0.0787907210088735, 0.724490288301106, 0.76100306145156, -0.133559880734554, 0.067260371592941, -0.44391845251341, 0.658562550560051, 0.681723007231123, 0.635402093888979, 0.612241637217907, -0.754225306375349,
+#> 0.450118440520402, 0.565920723875763, 0.704883463902196, 0.565920723875763, 0.125872047125392, 0.658562550560051, 0.681723007231123, 0.658562550560051, 0.542760267204691, 0.496439353862546, 0.565920723875763, 0.519599810533618, -0.5457811963357, -0.429978912980339, -1.56484128986287, -1.00899032975714, -1.98172950994217, -2.83866640677184, -2.59655058163641, 0.357132722486026, 0.819448370087799, 0.768079964798713, 0.665343154220541, -0.567498572717521, 0.588290546286912, 0.870816775376885, 0.331448519841483,
+#> 0.357132722486026, 0.125974898685139, 0.716711559509627, 0.819448370087799, -0.182235533049376, 0.562606343642369, 0.613974748931455, 0.459869533064197, -0.105182925115748, -1.28665624676472, -1.18391943618655, -2.13423493403464, -2.33469625648708, 0.247489247777123, 0.845469048764623, 0.492117348181101, 1.00855444903394, 0.600840948360646, -0.62229955365924, 0.763926348629964, -0.32330965316549, 0.709564548540191, 0.736745448585078, 0.682383648495305, 0.111584747552691, -0.160224252896172, 0.791107248674851,
+#> -2.44341985666663, -0.62229955365924, 0.220308347732237, -0.7038422537939, -1.27803206380043, 0.968699462371027, 0.659366860941623, -0.805892830039762, 0.936138135904774, 0.936138135904774, -0.0895436477821957, 1.13150609470229, 0.903576809438521, 0.919857472671647, -0.968699462371027, -1.11522543146917, -0.9524187991379, -1.24547073733418, -3.27220292331375, -1.0429332026498, -0.57361326145739, -0.338953290861185, 0.0130366650331225, 1.06900653271604, 1.30366650331225, 1.42099648861035, -0.221623305563083,
+#> 1.06900653271604, 0.83434656211984, 0.130366650331225, 0.482356606225532, 0.599686591523635, -1.0429332026498, 0.599686591523635, -0.10429332026498, 0.0130366650331225, 0.599686591523635, 0.0130366650331225, 0.482356606225532, 0.36502662092743, 0.247696635629327, 0.0130366650331225, -0.338953290861185, -0.338953290861185, -1.98157308503462, 0.182321083027619, 0.949142108702603, 0.844575605201468, 0.879431106368513, 0.722581351116812, 0.862003355784991, 0.896858856952036, 0.0951823301100068, -1.61273722707518,
+#> -1.22932671423769, -1.68244822940927, -0.183661679226351, -0.723921947315544, -2.41050837639301, -2.34759949995856, -0.732938338141039, 0.336512561244591, 0.734935445329434, 0.92366207463278, 0.734935445329434, 0.839783572720182, 0.692996194373135, 0.692996194373135, 0.734935445329434, 0.126816306463095, 0.588148066982387, -0.355485079534346, 0.42039106315719, 0.755905070807584, 0.315542935766442, 0.546208816026088, -0.858756091009936, -0.921664967444385, -0.816816840053637, -0.495259673319281, 0.635224363605165,
+#> 1.01205237591331, 0.785955568528425, 0.785955568528425, 1.01205237591331, 0.559858761143535, 0.785955568528425, 1.2381491832982, -0.87208768562743, -1.17355009547395, -1.77647491516699, -0.570625275780911, 0.258396351297016, 1.16278358083657, -0.193797263472762, -1.39964690285884, 0.635224363605165, 0.333761953758646, -0.94745328808906, -1.77647491516699, -1.80673465348438, 0.800607376162007, 0.852754216754934, 0.82668079645847, -0.111962334214227, -1.10275230547985, 0.487726332604441, 0.0966250281574835,
+#> 0.670240274679687, 0.670240274679687, 0.644166854383224, 0.670240274679687, -0.320549696585938, 0.513799752900905, 0.565946593493832, -1.10275230547985, -2.35427647971012, -1.26125218295864, 0.88229797202382, 0.938707186628622, 0.957510258163556, 0.957510258163556, 0.29940275444087, 0.63785804206968, 0.63785804206968, -0.640750822305824, -0.903993823794898, -1.14843375374904, 0.449827326720341, -1.80654125747172, -1.57612400880884, -1.96666801099156, 0.864776004833167, 0.962412005378847, 0.669504003741807,
+#> 0.962412005378847, -0.404492002260675, 0.669504003741807, 0.474232002650446, 0.278960001559086, 0.669504003741807, 0.278960001559086, -0.502128002806355, -1.38085200771748, -2.39495611653353, -0.280078400262871, 1.26321074404274, 0.434407314693432, -0.623031543441896, 0.177192457309163, -0.365816686057627, 0.94883702946197, 0.605883886282945, 0.863098743667214, -0.0514429714768537, 1.03457531525673, 0.148613028710911, -0.108601828673358, -1.65189097297897, -2.09017632544138, -1.06558008747992, 0.26639502186998,
+#> 0.922136614165315, 0.881152764646856, 0.922136614165315, 0.881152764646856, -0.26639502186998, 0.901644689406085, -0.430330419943813, -1.25000741031298, 0.77869314085071, 0.860660839887627, 0.676233517054564, 0.77869314085071, -0.430330419943813, -0.840168915128398, -1.49591050742373, -1.75612574646142, 0.809515213982215, 0.868270350480925, 1.06412080547662, 0.319889076492972, 0.652834849985658, 0.985780623478343, 1.02495071447748, 0.789930168482646, -0.835628607981642, 0.535324576988239, 0.907440441480064,
+#> -1.65820051896357, -0.561437970987666, -0.032641742499283, -0.816043562482072, -1.24691456347261, -1.05106410847691, -1.34338852003446, 0.246816788457774, 0.886777461387575, 1.35220340533652, 1.25523966701382, 0.0916748071414591, -1.14946104338906, -0.645249604111038, 0.576493498754944, 0.0916748071414591, -1.362781267699, -1.89361094305218, 0.706198140478206, -0.431218333566338, 1.0311742759195, 0.299977971176583, 0.543710072757557, 0.0562458695956094, 0.706198140478206, 0.381222005036907, 0.706198140478206,
+#> 0.624954106617881, 0.462466038897232, 0.381222005036907, 0.868686208198855, 0.949930242059179, 0.868686208198855, 0.543710072757557, -0.918682536728285, 0.137489903455934, 0.0562458695956094, -0.10624219812504, -0.0249981642647151, 0.0562458695956094, -2.6248072477951, -0.918682536728285, -2.46231918007445, -3.31882577818947, 0.381946478828775, 0.0349990797333142, 0.555420178376505, -0.485422018909877, 0.757806161182191, 1.01801671050379, 0.497595611860595, 0.757806161182191, 0.52650789511855, 0.671069311408325,
+#> -0.311948319362147, 0.64215702815037, 0.179560496023089, 0.35303419557082, 0.121735929507179, -0.196299186330326, -0.976930834295113, -1.20822910035875, -0.356614516030234, 0.521205831121112, 0.60350148866655, -0.63093337451503, 1.04241166224222, 0.0548637716969591, -1.92023200939357, 0.768092803757428, 1.0698435480907, -1.15213920563614, 0.650923120691309, -0.817415012886621, 0.1935718987572, 0.723136471523011, 0.626852003747409, 0.915705407074215, 0.843492056242513, 0.891634290130314, 0.939776524018115,
+#> -1.37105070259633, 0.69906535457911, 0.67499423763521, 0.771278705410812, 0.915705407074215, 0.843492056242513, 0.939776524018115, -1.32290846870853, -2.04504197702555, -0.335992674008611, -1.27476623482073, -0.263779323176909, -0.456348258728113, -1.08219729926953, -1.65990410592314, -1.89582727535399, 0.222415490404658, 0.963800458420186, 0.593107974412422, -0.836705892474668, 0.328327628692591, 0.0105912138287927, -2.47834403593762, 0.699020112700355, 0.328327628692591, 0.91084438927622, -1.1014862381945,
+#> -0.148276993603106, 0.804932250988287, 1.01675652756415, 0.91084438927622, 0.804932250988287, -0.677837685042769, 0.381283697836557, -0.836705892474668, -2.28162837857946, -1.88203508416879, 0.559923937229771, 1.00391648657496, 0.715321329500588, 0.360127290024434, -0.261462279058836, 1.02611611404222, 0.537724309762511, -1.19384663268374, 0.337927662557175, -1.01624961294566, 0.448925799893473, 0.870718721771406, 0.693121702033329, 0.0937317604173186, 0.648722447098809, -0.661055573469509, -1.68049212770476,
+#> -0.509966042826902, 0.530501588175636, 0.79061849592627, 0.725589268988612, 0.79061849592627, -0.509966042826902, 0.530501588175636, -0.509966042826902, 0.400443134300319, -0.835112177515195, 0.0752969996120258, -0.770082950577536, -1.35534599301646, 0.400443134300319, 0.140326226549684, -1.48540444689178, 2.35131994243008, 0.920676949801588, -0.201059964331669, 0.451026406473744, 0.581443680634827, 0.451026406473744, 0.320609132312661, -0.461894512653835, 0.972695503118075, 0.320609132312661, 1.03790414019862,
+#> 0.190191858151579, -2.54857089923116, -1.11398088345925, -1.90018372696428, -1.93915010013483, -1.58845274159981, 0.184517237660584, -0.107730561118602, 0.223483610831142, 0.944361514486468, -0.0882473745333229, 0.749529648633677, 0.807979208389514, -0.107730561118602, 0.846945581560073, 0.944361514486468, 0.710563275463119, 0.827462394974793, 0.437798663269212, -0.945507584285602, 0.273611386989137, 0.832477198711628, -0.0989658208258579, 0.762618972246317, 0.90233542517694, 0.203753160523825, 0.506472141873508,
+#> 0.972193651642251, 0.203753160523825, -0.541401255106164, 0.646188594804131, 0.832477198711628, 0.646188594804131, -1.23998351975928, -0.844120236455847, 0.809191123223191, 0.529758217361945, -2.31114299222739, -1.07698099134022, -2.0084240108777, -1.92913303916222, 0.793831204983724, 1.04553378217369, 0.221779893188358, 0.748067100040095, 0.885359414870983, 0.290426050603801, -0.624856048268785, 0.885359414870983, -1.86048688174678, -0.0528047364734184, 0.221779893188358, -0.624856048268785, -1.63466951875031,
+#> -1.55482134687106, 1.10013036811419, 1.17997853999344, 1.06020628217456, 1.06020628217456, 0.381496821200888, 0.840623809506607, -0.0975922100746456, 1.00032015326512, -0.217364467893529, -1.35520091717292, -0.0177440381953901, 0.521231121989585, -0.357098768682226, 0.181876391502749, -0.456908983531296, -1.63466951875031, -1.80141451301916, 0.387010120897885, 0.337832039236828, 0.190297794253656, 0.682078610864229, 0.706667651694758, 0.731256692525286, 0.805023815016872, -0.596551512323261, 0.264064916745242,
+#> 0.559133406711586, 0.288653957575771, 0.632900529203172, 0.608311488372643, 0.6574895700337, 0.48536628422, -0.42442822650956, -2.6866199829182, 0.509955325050529, 0.6574895700337, 0.337832039236828, -1.28504465557806, -2.04730492132445, -2.08977747981152, -2.22700489405806, -0.247009345643763, 0.0666533154911743, 0.439127725588912, 0.595959056156381, 0.831206052007584, 0.772394303044784, 0.850809968328518, 0.929225633612252, -0.482256341494966, -0.22740542932283, 0.831206052007584, 0.576355139835448,
+#> 0.380315976626112, 0.53714730719358, 0.890017800970385, -0.129385847718162, -1.85453048396032, -0.443048508853099, -1.8086732237708, 0.055226663321246, 0.32445664701232, -1.60157323631613, -0.731753289006508, 0.552266633212459, 0.842206615649, 0.800786618158066, -0.731753289006508, 1.17356659557648, 0.759366620667131, 1.04930660310367, 0.407296641994189, 0.32445664701232, -1.41518324760693, -0.98203627044251, -0.609634875752233, 0.921348635752243, 1.33512796318588, 1.25237209769916, 1.79028522336289,
+#> 0.424813442831872, -0.195855548318591, -0.609634875752233, 0.921348635752243, -1.1061700686726, -0.899280404955782, -0.816524539469053, -0.940658337699146, -0.48550107752214, 0.68480953538437, 0.721826267026769, -0.185083658211992, 0.111050194927195, 0.573759340457175, -1.90636167958352, -1.70812149274121, -1.67290249289088, -1.83138799221738, 0.774817996707354, 0.810036996557688, -0.140875999401337, 0.933303496033858, 0.933303496033858, 0.545894497680181, 0.933303496033858, 0.933303496033858, 0.61633249738085,
+#> -0.24653299895234, 0.475456497979513, 0.563503997605348, 0, -0.810036996557688, -1.10939849528553, -1.78502584794819, -1.70915226604435, 1.17404384630149, 1.47753817391684, -0.798669283198294, 0.718802354878464, 0.87054951868614, -0.343427791775266, -0.722795701294456, -0.343427791775266, 0.339434445359275, 0.794675936782302, 0.642928772974626, 0.946423100589978, -1.48153152033283, -0.343427791775266, 0.87054951868614, 0.339434445359275, -0.646922119390618, -1.9771629710725, -2.07265095547089, 0.29067665838921,
+#> 0.624884603783568, 0.601012607683971, 0.338420650588404, 0.601012607683971, 1.07845252967591, 1.24555650237309, 0.314548654488807, -1.04615512318822, 0.362292646688001, 0.959092549177927, 0.52939661938518, -0.497099212897491, -0.879051150491043, -0.473227216797894, -2.60563877009515, -0.888455626479435, 0.11945621868631, 0.866057585475751, 0.343436628723143, 0.604747107099447, 0.567417038759975, 0.492756902081031, 0.380766697062615, 0.754067380457335, 0.642077175438919, -1.3364164465531, 0.642077175438919,
+#> 0.455426833741559, -1.03777589983732, -0.523275729479521, -0.0064601941911052, -1.28816272170638, 0.965153012151116, 1.13053398344341, 1.21322446908956, 0.613718448154994, -0.978073400533327, -2.05304971393323, 0.799772040858823, 0.551700583920384, -1.16412699323716, -0.750674565006424, 0.531027962508847, 0.82044466227036, 0.138248155689651, -1.30047117161918, 0.698359734156943, 0.209284086998956, 0.400661514147733, 0.677095575584857, 0.443189831291906, -1.95966008735386, -2.00218840449803, -0.938980475893711,
+#> -0.981508793037883, 0.35813319700356, 0.911001319877807, -0.449904828735723, -0.0458858158660813, 0.996057954166153, -0.0458858158660813, 0.95352963702198, 1.18743538131493, 0.889737161305721, -1.63974413064721, -0.896932459753096, 0.907038740989751, 0.995468701810479, 1.1192706469595, 1.1192706469595, 0.0757971092749096, 1.04852667830292, -0.0303188437099637, -0.896932459753096, 0.323400999572947, -1.32139627169259, -1.14453635005113, 0.341086991737093, 0.624090559065931, 0.463242476832443, -1.94947875666987,
+#> 0.784938641299418, 0.865362682416162, 0.302394394598956, -0.823542181035455, -0.662694098801967, -0.099725810984762, 0.945786723532905, 0.624090559065931, 1.26748288799988, 0.624090559065931, 0.784938641299418, 0.704514600182674, -0.340997934334993, 0.543666517949187, 0.784938641299418, 0.784938641299418, 0.302394394598956, -2.02990279778661, -0.260573893218249, -0.743118139918711, -1.62778259220289, -1.86905471555312, -0.335587290780214, -1.74569927223169, -2.420100654665, -0.02904120785598, 0.829287824331874,
+#> 0.461432524822794, 0.645360174577334, 1.01321547408641, -0.151659641025673, 0.767978607747027, 0.890597040916721, 0.0935772253137134, 0.706669391162181, 1.31976155701065, 0.829287824331874, -0.5808241571196, -0.5808241571196, -0.5808241571196, -1.13260710638322, -0.678501115613103, -0.383888789096887, 0.794560516967975, 1.08917284348419, 0.303539972774283, -1.36592987748427, 0.00892764625806704, -0.0892764625806715, 0.107131755096806, 1.77660160535536, -1.56233809516175, -1.42610343192249, 0.205002368338859,
+#> 1.22110106358364, -0.169349782540796, 1.00718554879526, 0.44565732247578, 1.06066442749236, 1.03392498814381, -0.410004736677717, -0.837835766254465, -1.72023726475651, -0.410004736677717, -2.14088517029723, -2.11976532697654, 0.287896811582027, 0.858132581240635, 1.00597148448546, -0.240099271435203, 0.477975401468229, 0.499095244788919, 0.309016654902716, 0.583574618071675, 0.900372267882013, 0.689173834675121, 0.710293677995811, -0.0289008382283115, 0.0344586917337561, -0.00778099490762226, 0.393496028185473,
+#> -0.176739741473136, -2.03528595369379, -1.8643855211907, 0.409255358310153, -0.386518949515144, -0.613883037465229, 0.977665578185365, 1.43239375408553, 0.29557331433511, 0.977665578185365, -0.500200993490186, -0.727565081440271, -2.30327830250222, 0.586354695932347, 0.658595520893211, 0.75491662084103, -0.232374653624113, 1.01979964569753, 0.658595520893211, 0.586354695932347, 0.827157445801895, 0.875317995775804, 0.875317995775804, 0.321471671075845, 0.152909746167162, 0.75491662084103, -0.328695753571932,
+#> -2.06247555263267, -0.0638127287154301, -0.9307026282458, -0.978863178219709, -1.17150537811535, -0.0751669361988958, -0.0107381337426994, -1.23488538041043, -0.0751669361988958, 1.34226671783743, 1.36374298532282, 0.740931228246259, 0.246977076082086, -0.762407495731657, -0.118119471169693, 1.06307524052724, 0.655026158304663, -1.32079045035203, -1.8147446025162, -2.75554068167739, 0.572124972043188, -0.734291914232299, 0.818618724170638, 0.892566849808873, 0.473527471192208, 0.818618724170638,
+#> -0.512447537317594, 0.818618724170638, 0.596774347255933, 0.941865600234363, 0.695371848106913, 0.276332469490247, 0.448878095979462, 0.227033719064757, -1.74491629795485, -0.709642539019554, -0.487798162104849, -0.635694413381319, 0.750048583722261, 0.654618295168313, 0.718238487537612, -0.808646129325564, 0.145656756213921, 0.750048583722261, -0.363304782740471, 0.718238487537612, 0.559188006614364, 0.718238487537612, 0.559188006614364, 0.622808198983663, 0.241087044767869, 0.463757718060416, -0.108824013263275,
+#> 0.17746685239857, -1.19036728354136, -2.90811247751243, -1.69932882249575, -0.820205002526818, 0.956905836281287, -0.489579730190426, 0.83292135915514, 0.708936882028993, 0.83292135915514, 1.32885926765973, 0.419639768734651, -0.200282616896083, -1.3161429110314, -0.778876843484769, 0.4609679277767, -1.93606529666214, 1.12419191725934, -0.333744475436366, -0.790447441822972, 1.22131317870863, 0.162841757161151, 1.63294095375487, 0.456861596479895, -1.13084553584133, -1.48366934302382, -0.836825696522581,
+#> -0.072374114293845, -1.07204156797758, 0.75088143579864, 0.104037789297402, 1.04490127511738, -0.778021728658832, -1.8466880809018, -0.304259821109679, 0.921231125026528, 0.942360279270255, -0.0718391244286743, 0.709939582589251, 1.17478097595126, 1.00574774200144, 0.857843662295345, -0.177484895647313, 0.646552119858068, 0.498648040151974, 0.519777194395701, 0.709939582589251, 0.414131423177063, -1.59313822997707, -0.642326289009322, -1.88894638938926, -1.25507176207743, -0.621197134765595, -2.64580782428774,
+#> -0.432321539916297, -1.42839036788344, -0.487658697025583, -0.266310068588439, 0.148718609731206, 0.619084445160137, 0.508410130941565, 0.812764495042638, 1.28313033047157, -0.0726300187059378, 1.3661360661355, 0.425404395277636, 0.591415866605494, -0.238641490033796, -0.18330433292451, -1.39005217297715, -1.02182643179115, 0.243949553535725, 0.842316382962974, 0.980401035907724, 1.07245747120422, 1.1414997976766, -1.5281368259219, -0.00920564352965012, 0.865330491787099, 1.09547158002835, -0.0322197523537751,
+#> 0.773274056490599, 0.957386927083599, 0.405048315304599, -1.9884190024044, -0.768671234725774, -0.00920564352965012, -0.860727670022274, -0.768671234725774, -1.12071466629962, 0.570304504744185, 0.570304504744185, 0.570304504744185, 0.457569893341265, 0.344835281938345, 0.232100670535424, -1.12071466629962, 0.683039116147106, 0.795773727550026, -1.5716531119113, 0.457569893341265, 0.457569893341265, 0.457569893341265, -2.69899922594051, 0.119366059132504, 0.795773727550026, -1.66934570084308, -1.66934570084308,
+#> -1.06987991300915, 0.353851333096413, 1.55278290876426, 1.82753806152147, -0.0707702666192825, 0.37882907425616, 0.154029403818439, -0.895035724890927, 0.553673262374387, -0.145703490098523, 0.978294862090083, 0.253940368457426, 0.703539709332868, -0.620280572133712, 0.403806815415907, -1.01992443068966, -1.45856568724754, -1.45856568724754, 0.209988056140697, 1.32235721839952, -0.0283767643433374, -0.981836046279474, 0.76617263727011, 1.00453745775414, 0.76617263727011, 0.76617263727011, 0.845627577431455,
+#> -0.822926165956785, 0.368897936463386, -1.29965580692485, -1.71807263134289, -0.12794157892979, 0.639707894648949, 1.79118210501706, 0.310715263115203, 0.0365547368370827, 0.146218947348331, 0.475211578882076, 0.584875789393324, 0.146218947348331, -1.88256894710976, -0.402102105207911, -2.22881482457414, -2.06157173082238, 0.558570071288567, 0.688648033095493, 0.670065467123075, 0.42849210948164, 0.577152637260985, 0.688648033095493, 0.52140493934373, 0.651482901150657, -0.686461848863444, 0.52140493934373,
+#> 0.688648033095493, 0.447074675454058, 0.42849210948164, -0.463471057194427, -1.42976448776017, -1.28233694591757, -0.104680567013679, 0.915954961369693, 0.758934110849174, 0.680423685588915, 0.680423685588915, 0.994465386629952, 0.915954961369693, -0.261701417534198, 0.601913260328655, 0.680423685588915, -1.91042034799964, 0.444892409808136, -1.43935779643809, 0.209361134027358, 0.758934110849174, -0.968295244876532, -1.67488907221887, -1.05564133640677, -1.36558784277836, -0.581605503132575, 0.804037701822775,
+#> 0.968127028725383, 0.257073278814085, 0.694644817221037, 1.18691279792886, 0.475859048017561, -1.38381999021199, -0.435493361583058, 1.30735107147234, 0.044420322881472, 1.08002353672598, 0.978989076838714, 0.903213231923262, 0.92847184689508, 1.18105799661325, -0.283941671752154, 0.852696001979628, -1.04170012090667, -0.536527821470327, 0.751661542092358, 0.701144312148723, 0.271747857627828, -0.410234746611241, -1.57213103531484, -0.486010591526693, 0.145454782768741, 1.05476492175417, -1.87523441497665,
+#> -0.460751976554875, 1.15579938164144, 0.372782317515098, -1.90049302994847, -0.359717516667606, 0.423299547458732, -0.864889816103953, -1.92575164492028, -2.02276976237554, 0.219561613929909, 0.892261026821544, 1.34072730208263, -2.02276976237554, 0.0700728555095454, 0.219561613929909, 0.144817234719727, 0.144817234719727, -0.00467152370063636, 0.29430599314009, -0.527882178171908, -0.677370936592272, 0.219561613929909, 1.78919357734372, -0.0794159029108181, -1.60201960115142, -1.11204658970481,
+#> -0.377087072534893, -0.458749241109328, 0.888676540368855, 1.29698738324103, 1.29698738324103, 0.725352203219985, 0.725352203219985, 0.521196781783896, 0.439534613209461, 0.766183287507202, 0.480365697496679, 0.357872444635026, -1.43869526400255, -1.19370875827925, -1.3162020111409, -0.0777118113884822, 0.815147298181311, 0.666337446586345, -0.548943008105873, 0.0958996821389776, -1.09457913062075, 0.666337446586345, -0.64814957583585, 0.666337446586345, 0.666337446586345, 0.641535804653851, 0.591932520788863,
+#> 0.244709533733943, -2.95470227555782, 0.269511175666437, -2.12750616813454, 0.340153602463372, -0.24429213267824, -0.4823996544026, 1.2059991360065, 0.145338357416168, 0.773076369234936, 0.924599337604983, 1.18435299766792, 0.0154615273846986, 0.405092017479106, -1.60799884800867, 0.383445879140528, -0.915322421174164, -2.84274889637848, -0.411619749701862, -0.411619749701862, 1.44066912395652, -0.758923913512808, 0.630292741730976, 1.44066912395652, 0.398756632523679, 0.514524687127327, 0.398756632523679,
+#> 0.514524687127327, 0.28298857792003, -0.874691968116457, 0.514524687127327, 0.398756632523679, 0.28298857792003, -0.527387804305511, -0.990460022720106, -1.6554760662992, -1.29163517260707, -0.38203293837674, 0.0363840893692133, 0.982370412968759, 1.16429085981483, 0.873218144861119, 0.745873832068872, -1.18248290449943, 1.01875450233797, -0.673105653330446, -0.945986323599546, 1.20067494918404, 0.727681787384266, 0.345648849007526, -0.964178368284152, -1.55316676559119, -0.958203690062304, 0.294350153156394,
+#> 1.57821784245556, 1.01456861300715, 1.26507938165089, 0.294350153156394, 0.638802460041536, 0.356977845317329, -1.33396984302791, -0.0814159998092152, 0.889313228685276, -0.331926768452955, -0.989517536142772, -1.08345907438417, -1.34186260030423, 0.426956281914983, 1.64683137310065, 1.15888133662638, 0.487950036474267, 0.3659625273557, -0.121987509118567, 0.243975018237133, -1.40285635486352, -0.243975018237133, -1.21987509118567, -1.65403017298068, -1.67130701371, 0.626512803289548, -0.185498710988487,
+#> 0.712897006936147, -0.185498710988487, 0.816558051312067, 0.816558051312067, 0.816558051312067, 0.816558051312067, 0.782004369853427, 0.764727529124107, 0.712897006936147, 0.678343325477508, -0.306436596093727, -0.997510225266523, 0.661066484748188, -1.67130701371, -1.53309228787544, -3.22365342109438, 0.459607457574616, 0.513377689380003, 0.513377689380003, 0.48649257347731, 0.513377689380003, 0.513377689380003, 0.48649257347731, 0.513377689380003, 0.48649257347731, 0.513377689380003, 0.513377689380003,
+#> 0.513377689380003, -0.830878105754668, 0.0294456031315215, 0.540262805282697, 0.513377689380003, 0.48649257347731, -1.5298911192247, -1.61054646693278, -0.400716251311573, -1.81007416844907, 0.448789924911342, 0.543700180934889, 0.353879668887795, 0.183041208045411, 0.581664283344308, 0.581664283344308, 0.638610436958436, 0.600646334549017, 0.543700180934889, 0.600646334549017, 0.315915566478377, -1.31654083712663, -2.26564339736209, -1.33538114982285, -1.45867173559786, 0.813397630827347, -0.525185871872775,
+#> 0.936688216602359, 0.654881163402333, 1.02475292072737, 0.919075275777357, 0.496364695977318, -1.28254232734784, -0.24337881867275, -1.71716960308438, -1.88323570304688, -0.776128369963593, 0.478593274197461, 0.86608084077661, 0.718466529698839, 0.312527174234969, 0.773821896353003, -0.0565086034594593, 0.921436207430774, -0.148767547883066, 0.792273685237725, 0.312527174234969, 0.681562951929396, 0.552400429736347, -1.82788033639271, -0.0195113130123322, -0.195113130123322, 0.995076963628943, 0.0585339390369967,
+#> 0.780452520493289, 1.0926335286906, 0.858497772542618, 0.663384642419296, -1.42432584990025, -1.48285978893725, -1.32676928483859, 0.169060169559253, -0.222852041691742, -0.157533339816577, -1.00667646419373, 0.69160978456058, -1.46390737731989, 1.34479680331224, 0.756928486435745, 1.14884069768674, 0.756928486435745, -0.484126849192406, 1.27947810143707, 0.495653678935082, -0.0922146379414108, 0.169060169559253, -1.92113829044605, -1.46390737731989, -1.23614114020115, -0.0561882336455068, -0.449505869164054,
+#> -1.55079524861599, -1.47213172151228, 0.966437618702716, 1.04510114580643, 0.33712940187304, 1.28109172711755, 0.258465874769331, 0.966437618702716, 0.573119983184169, 0.494456456080459, -1.15747761309744, -0.727598404868498, -1.60315991818973, 0.514477230308136, 0.0665155258182022, 0.840267560846269, 1.2271435783603, 1.3493149523121, 0.147963108452736, 1.26786736967757, 0.209048795428636, -1.01266494408937, -1.23664579633433, 0.799543769529003, -1.05338873540663, -0.788684091844398, -0.790951268801029,
+#> 0.720119811893474, 0.059026214089629, 0.909003696980287, 0.720119811893474, 0.625677869350068, 0.720119811893474, 0.909003696980287, 0.531235926806661, 0.436793984263255, 0.436793984263255, 0.436793984263255, -1.8298126367785, -0.696509326257623, -2.30202234949553, -0.885393211344435, -1.35333432368308, -1.35333432368308, 0.301090659610112, -0.456356923102435, 1.41732920255492, 0.899075593330544, 1.19806806019076, 0.6997472820904, -1.13407318131892, 0.978806917826602, -0.735416558838637, -0.835080714458709,
+#> 0.978806917826602, 0.998739748950616, 0.739612944338429, -0.0178346383741181, -1.5127969726752, 0.181493672866026, -0.994543363450824, -1.47150936140634, 0.699961209750042, 0.389751128156273, 0.389751128156273, 0.906767930812555, -0.127265674500008, 0.906767930812555, 0.699961209750042, -0.851089198218801, 0.389751128156273, 0.49315448868753, -0.0238623139687513, -2.40213960618764, -1.74368071324977, -1.66489995813306, -1.27099618254953, 0.383399674901305, 0.934864960718251, 0.856084205601544, 0.777303450484838,
+#> 0.856084205601544, -0.168065610915641, -0.64075014161588, 0.856084205601544, 0.856084205601544, 0.540961185134718, 0.462180430018012, -1.03465391719941, -1.42137312638253, -1.42137312638253, -1.39971905681546, -0.988291735041116, -1.39971905681546, -0.59851848283384, 0.00779546504414551, -0.252053369760705, -1.0749080133094, 0.440876856385564, 1.41530998690375, 1.1554611520989, 1.04719080426355, 0.462530925952634, 1.17711522166597, 1.24207743036719, 0.83065010859284, 1.32869370863547, 1.11215301296476,
+#> -0.230399300193634, 0.137719882446571, 0.181028021580713, -0.187091161059493, -0.208745230626563, -1.35641091768132, -2.25138055665027, -0.450276111330055, 0.959283889355334, 0.64604833364747, 0.411121666866572, 0.332812777939606, 0.0195772222317415, 0.332812777939606, -2.06083888724543, 0.262791535957472, 0.650063273157956, 0.262791535957472, 0.940517076058319, 0.746881207458077, -0.705387807043739, -0.414934004143376, -0.221298135543134, -1.86720301864519, 1.23097087895868, -0.124480201243013,
+#> 0.940517076058319, 0.359609470257593, -2.93844157897832, 0.498753887638447, 0.546826551507213, 0.498753887638447, 0.426644891835298, 0.450681223769681, -0.0781180787867447, 0.474717555704064, 0.52279021957283, 0.474717555704064, 0.546826551507213, 0.546826551507213, -0.438663057802489, -1.88084297386547, 0.354535896032149, -0.00600908298359575, -1.88993070926049, -0.755560534094337, 0.652623131629169, 0.906878515718135, 0.828646089844607, 0.828646089844607, 0.769971770439461, 0.222344789324764, 0.867762302781371,
+#> 0.711297451034315, 0.750413663971079, 0.711297451034315, 0.554832599287258, 0.417925854008584, -1.26407130227227, -0.266607872384787, -0.736002427625955, -1.44009426048771, -1.87037260279211, 0.193078825122064, 0.840460768178395, 0.786512272923701, 0.975332006315131, 0.220053072749411, 1.00230625394248, 0.570718291904924, -1.5602472706555, -2.34250045184857, 0.247027320376758, 0.408872806140841, 0.597692539532271, 0.381898558513494, -1.91091248981101, -1.31747904200938, 0.193078825122064, 0.166104577494717,
+#> 0.112156082240022, 0.435847053768188, -1.97556262485778, -0.570312536044393, -0.506437532007421, 0.920104224818288, 1.17560424096618, -0.016729167723969, 1.09043756891688, 0.813645884756667, -0.399979191945801, -1.69877094069757, -0.357395855921153, 0.643312540658075, 0.920104224818288, -0.038020835736293, -1.12848380058883, -1.09086767390253, 0.827554787098474, 0.564241900294414, 0.978019293843651, 1.35418056070659, 1.35418056070659, -0.639474153667003, -1.09086767390253, 0.225696760117766, -0.26331288680406,
+#> -1.09086767390253, -1.1074758382197, 1.64743918222732, 1.51520326124586, 1.00829889748361, 0.347119292576325, -0.887082636583942, -0.247942351840232, 0.104686770776987, -0.424256913148842, -1.06339719789255, 0.281001332085597, -1.17359379871043, 0.532808089431272, 0.993996354213941, 0.329885252926897, 0.791073517709567, 1.12312906835309, 1.10468153776178, 0.754178456526953, 1.08623400717048, 0.846416109483487, -0.924546827281963, -1.12746966378634, -1.18281225556026, -1.12746966378634, -0.555596215455828,
+#> -1.51486780620378, 0.14540994701383, -1.27504990851679, -1.37616123065853, 0.760765187371089, 0.97881890349656, 1.10965113317184, 0.586322214470712, 0.499100728020524, 0.847986673821277, 0.891597417046372, 0.847986673821277, 0.368268498345241, 0.324657755120147, 0.324657755120147, -1.68143643323419, -0.416724879706456, -0.15506042035589, -1.37616123065853, -0.547557109381738, -1.98671163580985, -0.705571144772183, -1.24437092805276, 0.564456915817746, 0.718399711040768, 0.987799602681056, 0.756885409846523,
+#> 0.756885409846523, 0.872342506263789, -0.166771361491607, 0.102628530148681, -0.39768555432614, -2.2449990970024, -1.88692642525959, 0.799892723751347, 0.574281955513787, 0.6563222348729, 0.635812165033122, 0.6563222348729, -1.90743649509937, 0, 0.615302095193344, 0.225610768237559, -0.369181257116006, -2.11717519498447, -1.6125634904804, -0.493641884840938, -0.120668016294452, 1.02019322867127, 0.932434671366217, 0.910495032039953, 0.800796835408633, 0.756917556756105, 0.800796835408633, -0.471702245514674,
+#> 0.405883327535883, 0.010969819663132, -0.822736474734897, -2.78451238951803, -0.965065482030365, -0.161673341061788, 0.192764368189055, -0.397965147229016, -0.0907857992116193, 0.216393548805778, 0.783493883607127, 0.688977161140235, 0.783493883607127, 0.854381425457295, -0.397965147229016, 0.736235522373681, 0.854381425457295, 0.854381425457295, 0.405426993739561, 0.405426993739561, 0.0509892844887179, -2.02837860978289, -1.22887494980254, -0.266588881221666, -0.929497061799604, 0.930922670790094,
+#> 1.31583709822245, -1.87039899552313, -0.181052341792254, 0.289398625069509, -1.2930273543746, 0.0541731416386272, 0.930922670790094, 1.20891642393568, 1.14476401936362, 0.0541731416386272, -0.159668206934901, -1.94933590834182, -0.448394458335286, 0.117998541667181, -0.39175515833504, 0.910948741670635, 0.995907691671005, 0.202957491667551, 0.825989791670265, 0.854309441670388, 0.797670141670141, -0.2218372583343, -1.69445905834071, -0.718298939913488, -0.857324541187066, 0.32439306963835, -1.34391414564459,
+#> 0.115854667727982, -0.370734936729542, 0.671957072822295, 0.741469873459084, 0.463418670911928, 1.71464908237413, -1.13537574373422, 1.36708507919019, -1.20488854437101, 1.08903387664303, -0.857324541187066, -1.96025849968873, -1.78069283559511, -0.324215782391266, 1.03250256853834, 1.03250256853834, 1.11230953035773, 0.912792125809256, 0.932743866264103, 0.693322980805938, 0.0947707671605238, 0.81303342353502, 0.513757316712313, 1.01255082808349, 0.793081683080173, 0.214481209889607, -0.0648431564782532,
+#> 0.573612538076855, -0.902816255581832, -0.603540148759126, 0.0947707671605238, -0.922767996036679, -2.00016198059842, -1.14223714104, -0.124698377842795, -1.40776585279977, -0.399412637305981, 1.0672829488668, 0.792277526459405, 0.929780237663104, 0.746443289391506, 0.792277526459405, 0.654774815255707, 0.700609052323606, 0.700609052323606, -1.72860551227507, 0.196432444576712, 0.838111763527305, 0.975614474731003, -1.86610822347876, 0.288100918712511, -0.353578400238082, 0.150598207508813, -1.72860551227507,
+#> -0.261909926102283, -1.08692619332447, -1.9094536475493, -1.02478015465958, -0.298894211775711, -0.616469311787404, 0.721882895404731, 1.19824554542227, 1.31166522399788, 0.517727473968642, 0.721882895404731, 1.22092948113739, -0.571101440357162, -0.162790597484985, 0.812618638265215, -1.81871790468881, 0.44967566682328, 0.041364823951103, -0.593785376072283, 0.632765818172794, 0.0761969309841585, -0.0629452908130003, -0.0165645502139473, -1.87179417417606, 1.00381174296522, -1.96455565537417, 0.447242855776582,
+#> 1.23571544596048, 0.957431002366164, 0.493623596375635, -0.387610475006371, 0.447242855776582, -0.990560102794059, -1.71750267489846, -1.71750267489846, 0.675038364761087, 0.675038364761087, 1.12363980969725, 0.653676391192698, 0.375970734803643, 0.0555411312778109, -0.47850820793191, 0.354608761235255, -0.0943360347296083, -0.270429966224877, 0.610039691251466, 1.49050934872781, 0.521992725503832, -1.76722838393466, -1.50308748669176, 0.786133622746734, 0.874180588494369, 0.610039691251466, 0.786133622746734,
+#> -0.0943360347296083, -1.41504052094412, -0.53457086346778, 0.499518443498022, 0.582771517414359, 0.027751024638779, 0.638273566691916, 0.166506147832674, 0.222008197110232, 0.166506147832674, 0.305261271026569, -2.60859631604522, 0.673272305986067, 1.06420461268765, 0.868738459336861, 0.0868738459336861, 0.966471536012258, -0.499524614118695, 1.06420461268765, 0.28233999928448, 0.868738459336861, 0.57553922931067, -1.67232153422346, 0.477806152635274, -0.401791537443298, -0.108592307417108, 0.184606922609083,
+#> -2.25871999427584, -0.597257690794092, -1.57458845754806, -1.90978879933196, -1.01106465846986, 1.01106465846986, 0.898724140862098, 1.06723491727374, 0.98297952906792, 0.308936423421346, 1.01106465846986, 0.533617458636871, 0.337021552823287, 0.168510776411643, 0, -0.337021552823287, 0.365106682225227, -0.168510776411643, 0.758298493852395, 0.140425647009703, -0.308936423421346, -2.41532112856689, -1.43234159949897, -2.00560444850632, -0.0607758923789792, 0.0276254056268087, 0.469631895655749, 0.292829299644173,
+#> -2.27080834252368, -0.591183680413707, -0.502782382407919, 0.823237087678901, 0.823237087678901, 0.734835789673113, 0.911638385684689, 1.26524357770784, 0.292829299644173, 0.381230597649961, -0.591183680413707, -2.85467474011793, -0.864694008417465, 0.604101293551927, 0.746242774387675, 0.817313514805549, 0.319818331880432, 0.390889072298306, 0.722552527581717, -0.604101293551927, 0.580411046745969, 0.698862280775759, 0.153986604238727, -0.722552527581717, 0.011845123402979, -1.20049009599756, -0.257247877713763,
+#> 0.0857492925712544, -0.857492925712544, -1.45773797371132, 1.11474080342631, 0.685994340570035, 1.20049009599756, 0.685994340570035, 1.38059314425033, 0.748706282074217, 0.568167178595328, 0.838975833813661, 1.01951493729255, 1.38059314425033, -0.334528338799118, 0.387628075116438, -0.605336994017452, -0.424797890538563, 0.0265498681586601, -1.32749340793301, -0.695606545756897, -1.59830206315134, 0.658436730334772, -0.153989235320229, -1.86911071836968, -1.64595981392466, -1.42298877610231, 0.769559762484059,
+#> 0.49084596520613, 1.02969263994346, 0.639493323754359, 0.565169644480245, 0.379360446294959, 0.695236083209945, 0.713817003028474, -0.939884860820571, -1.27434141755409, -2.46491495735643, -1.08493429320024, 0.734131127732923, 0.692313531849402, 0.775948723616444, 0.671404733907642, 0.232319977130672, 0.629587138024121, 0.755039925674683, 0.650495935965881, 0.796857521558204, 0.5877695421406, 0.566860744198839, 0.211411179188911, -0.206764779646298, -0.541305546714465, -1.37765746438488, -1.62856303968601,
+#> -1.44132866896808, 0.565125269487487, -1.11469663247532, -1.44132866896808, 1.21838934247302, 0.798433866982321, 0.891757305980254, 0.65844870848542, 0.611786988986453, 0.65844870848542, 0.65844870848542, 0.751772147483354, -0.0881388034980482, 0.37847839149162, -1.62797554696395, -0.134800522997015, 0.425140110990586, -1.76796070546085, 0.662597608129988, 0.844603773379339, 0.642374700880061, 0.783935051629555, 0.763712144379628, 0.864826680629267, 0.7434892371297, -2.12816359236005, 0.339031092131143,
+#> -0.348547754366403, 0.0963562051320091, 0.662597608129988, 0.500814350130566, -0.692337177615176, -2.12816359236005, -0.510331012365826, -1.09679532261373, 1.05780684273932, 1.11760211514181, 1.05780684273932, 1.09767035767431, 0.938216297934336, 0.519649391116893, -0.516801997192965, -0.536733754660462, -0.11816684784302, 0.121014241766948, -0.457006724790473, -1.15461823615288, -1.29414053842536, -1.83229799004779, -1.72369490303545, -2.22469964993849, 0.638184618078871, 0.590469880278581, 0.638184618078871,
+#> 0.566612511378437, 0.566612511378437, 0.495040404678002, 0.232609346776411, 0.399610929077424, 0.542755142478292, -0.721685409229377, -1.94814403578474, -0.265311444562124, 0.371436022386973, 0.9172195654862, 0.985442508373603, 1.05366545126101, -0.674649101886544, 0.0530622889124247, 0.939960546448668, 0.871737603561264, 0.985442508373603, -0.151606539749785, -0.629167139961608, -0.788354006698883, -1.72073422616006, 0.798119083029791, -0.503215307212232, 1.23924938480675, 1.12896680936251, 0.930458173562878,
+#> 1.2171928697179, 0.886345143385182, 0.59961044723016, 1.1730798395402, -0.194424095968362, -1.20902379005536, -1.60604106165462, -0.0400284903464275, 0.798119083029791, 0.776062567940943, 0.29081923598629, -0.238537126146058, 0.489327871785921, 0.842232113207487, -1.34136288058845, -0.260593641234906, -0.0179719752575796, 0.0481975700089639, -1.69426712201002, -0.723780458100711, -1.78249318236541, -1.60604106165462, -1.7187897377481, 0.198240779568492, 0.862558285569291, 0.558870282826069, 0.843577785397839,
+#> 0.767655784712034, 0.57785078299752, -0.78874522934698, -1.30121873397617, -1.56145744504261, -0.360708774126122, 0.162197905143961, 0.781939154649244, -0.108938891514601, 0.975608295119645, 1.24674509177821, 1.11117669344893, 0.898140638931485, -0.167039633655721, -1.54209053099557, 1.09180977940189, -1.30968756243109, 0.472068529896602, -0.476910258408363, -1.21285299219589, -1.45351417585211, -0.557984114900571, -0.378878102710265, 0.874863982621884, 1.05396999481219, 1.2330760070025, 1.32262901309765,
+#> 0.695757970431577, -0.468431108805418, -1.18485515756665, 0.0688869277655027, -1.45351417585211, 0.24799293995581, -1.40332982601814, -0.995858912540168, 0.731817760606441, 1.00889798177146, 1.0414956548497, 0.699220087528203, 0.91110496253675, -0.132020575966863, -0.523192652905718, -1.33813447986167, -1.4018069114177, -2.38649079065745, 0.5675608470618, 1.05990278668168, 0.895788806808383, 0.895788806808383, 0.239332887315217, 0.895788806808383, 0.403446867188508, -0.0888950724313665, -0.909464971797825,
+#> -1.07357895167112, 0.731674826935092, 0.731674826935092, 0.5675608470618, 0.0752189074419251, 0.403446867188508, 0.5675608470618, -0.0888950724313665, 0.5675608470618, 0.5675608470618, 0.403446867188508, -1.73003487116428, -1.89414885103757, -0.746417155578884, -1.76783010531841, -0.320828426520748, 0.870820014842031, -0.235710680709121, 0.360113539972268, 0.785702269030404, 0.955937760653658, 0.785702269030404, 0.445231285783895, 0.530349031595522, 0.445231285783895, -2.10830108856492, -2.01787777144739,
+#> 0.596886322173479, 0.827600801022379, 0.923731833876088, 0.885279420734604, 0.827600801022379, 0.769922181310154, 0.36617184332458, 0.308493223612355, 0.769922181310154, 0.731469768168671, 0.308493223612355, -1.80638949916923, -0.614364691783245, -0.460555039217311, 0.443076669607546, 0.519981495890513, 0.654564941885704, -1.47954398746662, -0.44132883264657, -0.0183522880902534, -2.09478259773035, -1.61658913088645, 0.555473509162252, 0.345888517578606, 0.00293125862354763, 0.860324406011193, 0.917483949170369,
+#> 0.936537130223428, 0.517367147056135, 0.364941698631664, -1.69280185509868, 0.822218043905075, -0.492451448755981, -1.52132322562116, -1.24952786154928, 0.753763770732158, 0.753763770732158, 0.510940542576832, 0.571646349615663, 0.632352156654495, -0.156823334850315, 0.207411507382674, 0.693057963693327, 0.450234735538, -2.46364400232591, -0.7031755981998, -2.05863250708645, -0.534167324316079, 0.990297858454295, 1.03206402784526, 0.677051588022026, 0.844116265585903, 0.551753079849119, 0.990297858454295,
+#> 0.656168503326541, 0.864999350281387, -1.36949071213546, -0.408868816143172, -0.200037969188326, -0.116505630406388, 0.134091385939427, 0.509986910458149, 0.593519249240088, -1.78715240604515, -1.36949071213546, -0.766123921441016, 0.572126876955952, 0.951900752176714, 0.933816281928106, 0.789140519939245, 0.897647341430891, 0.481704525712914, -1.74268531486583, -0.18742087348557, -0.368265575971647, -1.56184061237975, -1.56010797461763, 0.437816862442103, 0.659808511004296, 0.955797375753886, 1.02979459194128,
+#> 0.437816862442103, 0.881800159566489, -0.00616643468228305, -0.376152515619271, -1.19012189368065, -1.78209962317983, 0.5118140786295, -2.0425029871628, 0.935751368537377, 0.98800144495317, 0.622250910042621, -0.475000694689024, 0.570000833626829, -1.10200161167854, -0.945251382431158, 0.152000222300488, 0.831251215705792, 0.465500680795243, -1.55171071826912, 1.27296028983754, 1.31709577433921, 1.29502803208837, -0.75727199723912, 0.699198991315875, 1.20675706308504, -0.0511042452124558, -1.70618491402495,
+#> -0.867610708493286, 0.25784414629921, 0.0592344660417104, -0.0731719874632891, 0.19164091954671, 1.14055383633254, 0.301979630800876, -1.37516878026245, -0.845542966242453, -0.514526832479954, -1.54404752167409, -0.0277373806288758, 1.04477467035432, 0.915333560752903, 0.93382514783882, 1.04477467035432, -0.157178490230296, -0.970808322010654, 0.0832121418866275, -1.32214847664308, -1.387791830104, -0.149613245624595, 0.345658188167167, 0.985383790148193, -0.624248369675033, -0.190885865107242, 1.04729271937216,
+#> 1.31556474600937, 1.1711105778201, -0.211522174848565, -0.582975750192387, -1.71797278596517, -1.46988300511431, -0.267398782628292, 0.413252664061905, 0.163680466942166, 1.34347630787184, 1.59304850499158, 1.38885307098452, -0.49428259819169, 0.481317808730925, 0.435941045618245, -1.44719462355797, -0.766543176867769, -0.63041288752973, -0.743854795311429, 0.768776006690737, 0.953282248296514, 1.0455353690994, 0.676522885887849, -0.153755201338148, 0.307510402676295, -1.53755201338148, -1.44529889257859,
+#> -0.61502080535259, -0.343851163950895, 0.692685678103977, 0.692685678103977, 0.772419281338968, 0.852152884573958, 0.772419281338968, 0.692685678103977, -0.184383957480915, -1.1411871963008, 0.692685678103977, 0.692685678103977, 0.692685678103977, 0.214284058694036, -1.61958881571074, -1.85878962541571, -1.61958881571074, -1.98275427667658, 0.891652810813139, 1.2436210256078, -0.516220048365501, -0.692204155762831, 1.12629828734291, 0.950314179945582, 0.481023226886035, -1.22015647795482, -0.516220048365501,
+#> 1.12629828734291, 0.422361857753592, 0.0117322738264888, -0.164251833570841, -1.16149510882238, 0.885479252659977, -0.332054719747491, 1.10684906582497, 0.885479252659977, 0.885479252659977, -0.332054719747491, -1.88164341190245, 0.664109439494983, 0.77479434607748, 0.664109439494983, 0.885479252659977, -0.996164159242474, 0.442739626329988, -0.996164159242474, -1.99232831848495, -0.442739626329988, -0.221369813164994, -1.19524537091684, 0.714817877125664, 0.947752419569873, 0.947752419569873, -0.193626838406748,
+#> 1.01763278230314, 0.062601158281881, 0.807991694103348, 0.971045873814294, 0.994339328058714, -0.962310828472636, 0.342122609214931, -1.77758172702736, -0.170333384162327, -1.591234093072, -0.915723919983794, -1.39581852414128, -1.25989612104138, 0.960169796256984, 1.2093608686068, 1.18670713475682, 0.00871297455768593, 0.643017522357218, 0.914862328557017, 0.620363788507234, -0.693552774791796, -1.50908719339119, -0.195170630092164, -0.489669170141946, -0.865564740434214, -0.89153168264724, 1.08195592554277,
+#> 1.00405509890369, 1.15985675218185, 1.05598898332974, 0.952121214477636, -0.0346225896173684, -0.372192838386712, -1.74844077567711, 0.458749312430134, -1.38490358469474, 1.00405509890369, -1.25506887362961, 1.05598898332974, -0.839597798221188, 0.0432782370217108, -0.424126722812765, -0.0761577967119403, 0.337457823361529, -0.462199042113845, -1.75819465167738, 0.888945316792822, 0.668350319420305, -3.16448775992718, 0.337457823361529, -0.627645290143233, -0.269178419412893, 0.723499068763434, 0.751073443434999,
+#> -0.682794039486362, 0.833796567449692, 0.833796567449692, 0.888945316792822, -0.351901543427587, 0.0617140766458828, 0.916519691464386, 0.199585950003706, -0.0485834220403757, -1.49249928601951, -1.5503200816038, 0.878153332936421, -0.00843219935604245, -1.5695936801319, -0.991385724288991, -0.162620987580819, 0.974521325576906, 0.916700529992615, 0.858879734408324, 0.0108413991720546, 0.82033253735213, 0.10720939181254, -0.856470534592312, 1.18653090938597, 0.878153332936421, -1.90685587123723,
+#> 0.842762193091453, 0.925457473221638, 0.677371632831081, 0.946131293254185, 0.904783653189092, 0.594676352700895, -1.72079149094431, -1.30731509029338, -0.128907348438231, 0.408611972407977, -0.108233528405684, -1.22461981016319, 0.925457473221638, 0.884109833156545, -0.439014648926428, -0.273624088666056, -1.83221259330245, 1.05369002618493, 0.897090659235998, 0.673377277880388, 0.024608471949117, 1.18791805499829, 0.158836500762483, 0.897090659235998, 0.0469798100846781, -0.400446952626543, 0.829976644829315,
+#> -0.0425055424575661, -1.87695526957357, 0.225950515169167, -0.221476247542055, 0.762862630422632, 0.606263263473704, 0.203579177033605, -1.1163297729645, -2.07829731279362, -1.0230672795738, -1.26672910493794, 1.3323303656129, 1.06836338813508, 0.357683064156336, -0.515438476731837, 0.459208824724728, 1.3323303656129, 1.0480582360214, 0.134326390905873, -0.840320910550692, -0.880931214778049, -1.2058136485969, -1.33601310931824, 1.27978033693764, 1.29820141754508, 1.00346412782611, 1.27978033693764,
+#> 1.22451709511534, -0.0833796280126041, -0.728117449272856, 0.966621966611236, 1.15083277268559, -1.13338122263644, -0.8018017717026, 0.229778742313804, -0.58074880441337, -0.267590434086962, -1.39127635114054, -0.396537998339012, -0.838643932917471, -0.875486094132343, 2.6494153102604, 0.385674380607527, 0.385674380607527, 0.385674380607527, -0.871959469199626, 0.134147610646096, -0.368905929276765, 0.134147610646096, 0.134147610646096, 0.217989867299907, -0.536590442584385, -2.21343557566059, -0.117379159315334,
+#> 0.217989867299907, -0.536590442584385, -1.91403959573439, 1.45377200966336, 1.45377200966336, 1.28538142939348, 0.106647367504262, -0.398524373305401, 0.527623818178981, -0.230133793035513, -1.24047727465484, 0.864404978718757, 0.0224520773693183, -0.987891404250008, 0.0224520773693183, -0.145938502900569, -0.81950082398012, -0.54319603260478, -0.421403200182184, -0.54319603260478, -0.482299616393482, -0.604092448816078, -0.786781697449973, -1.21305661092906, -0.604092448816078, -0.908574529872569,
+#> -2.06560643788724, -1.15216019471776, -1.03036736229517, -0.604092448816078, 0.674732291621184, 1.04011078888897, 0.492043042987289, 1.22280003752287, 1.46638570236806, 1.58817853479066, 1.28369645373417, 0.1266645457195, 0.552939459198588, 1.22280003752287, 0.857421540255079, 0.431146626775991, -3.20037268556518, 0.35462405954963, -0.197013366416461, 0.599796248867892, 0.109451870231367, 0.569149725203109, 0.538503201538326, -0.197013366416461, -0.227659890081244, 0.109451870231367, 1.05949410383963,
+#> 0.35462405954963, 0.415917106879195, -0.288952937410809, -1.80619980754231, 1.39307963879593, 0.701343542290365, 0.701343542290365, 0.960744578479952, 0.614876530227169, 0.528409518163974, -2.15206785579509, -0.682128650720766, 0.528409518163974, 0.441942506100778, -0.682128650720766, -0.249793590404788, 0.355475494037582, 0.269008481974386, 0.441942506100778, 0.269008481974386, -1.63326578341592, -1.67203672351796, -1.84897182653573, -0.840441739334423, 0.203475368470439, 0.805054718730869, 0.769667698127314,
+#> 0.681200146618427, 0.805054718730869, 0.822748229032646, 0.451184512695322, 0.539652064204209, -0.716587167221982, -2.04541316490393, -1.86979688306874, 0.983967696753025, 0.171742393265292, 0.91811159106483, 0.237598498953486, 0.91811159106483, 0.852255485376636, 0.698591238770848, -0.311202381781468, -0.28925034655207, 0.698591238770848, -0.881955297745821, 0.698591238770848, 0.43516681601807, -1.47466024893957, 0.259550534182885, -0.429628685917068, 0.457801058764088, 0.679658494934377, 0.457801058764088,
+#> 0.950817583586953, 0.876865104863523, 0.285245275076086, 0.433150232522945, 0.482451885005232, 0.876865104863523, -0.873343558257646, -0.331025380952495, -2.5002980901731, -1.36636008308051, -1.6832000190009, -1.6832000190009, 0.0337202007145422, 0.125045744316428, 0.965240745453774, 1.07483139777604, 0.946975636733397, 0.983505854174151, 1.00177096289453, -0.532498169617148, -0.806474800422804, 0.198106179197936, -0.623823713219033, 0.0579144535724575, 1.11195750859118, 1.67951915360127, 1.19303774359262,
+#> 1.3551982135955, 0.5443958635811, 0.138994688573898, -0.104246016430423, -1.80693095146067, -1.48261001145491, -0.509647191437625, -0.428566956436185, -0.185326251431864, 0.46331562857966, 0.625476098582541, -0.590727426439066, 0.706556333583981, 0.382235393578219, -1.23936930645059, -0.104246016430423, -1.80693095146067, -2.17046285563848, 0.961424537942142, -0.544750315459224, 0.746256701741946, -1.59668195910462, -0.0905071057032568, 1.22440744885349, 0.0768456557857838, 0.722349164386369, 1.15268483678676,
+#> 0.339828566697133, -0.257859867192297, 0.0768456557857838, -0.640380464881533, 0.839588884180998, -0.16645444109035, 1.04079754923527, 1.13225603335084, 0.0896293144332657, 1.04079754923527, -0.422538196613966, -1.30053964412351, -1.57491509647024, -0.678621952137582, -1.59511946724389, 0.89842647943497, 1.1046596028445, 1.1046596028445, 0.89842647943497, 0.504708698380413, 0.954671876728478, 0.917174945199472, 1.04841420555099, 0.842181082141462, -1.23889861771834, 0.804684150612456, 0.20473324614837,
+#> 0.20473324614837, -0.432714589844722, -1.10765935736682, -1.87634645371143, -1.42638327536337, 0.448463301086905, 0.0359970542678452, 0.448463301086905, 0.129739383090359, -0.113990671848176, -1.61386793300839, -1.14515628889583, -1.73967172040001, -1.46524463211156, 0.377337246396623, 1.02420109736226, 0.769375943951556, 1.04380303224001, 0.808579813707049, -1.11240980431212, 0.788977878829302, -0.210720799935776, 0.27932757200789, -0.563555627735216, -1.95973980386727, -0.173145272485741, 0.753237077119496,
+#> 0.973804303215981, 0.863520690167739, 0.929690857996684, -0.129031827266444, -0.393712498582226, 0.157705566658987, -0.217258717705038, 0.665010186680902, 1.01791774843528, 0.907634135387036, 0.885577412777387, 0.620896741461605, -1.40832173862606, -0.901017118604141, -0.195201995095389, -0.0628616594374981, -2.33470408823129, -0.833421661546949, -1.10961372380379, 0.685634680865658, 1.09992277425092, 1.19198679500319, 1.12293877943898, 1.05389076387478, 0.386426613420751, 0.639602670489519, -0.0738934903406453,
+#> -1.15564573417993, -0.7183416356066, 1.09992277425092, 0.961826743122496, -1.91517390538623, -0.902469677111159, -1.178661739368, 0.0642025407877735, -0.419133568161693, -1.4073984358923, -1.33145967136573, 0.0354380901123958, -1.10364337778604, 1.02264202895771, 1.47827461611709, 1.2504583225374, -0.42019449704698, -0.0405006744141669, 0.870764499904586, 0.642948206324897, -0.11643943894073, -0.875827084206357, 1.02264202895771, -1.02770461325948, -2.0028410497269, 0.278768026193252, 0.984980359216156,
+#> -0.481768332446799, 1.17511444887617, 0.224444000576105, 0.68619821832185, -0.40028229402108, -0.128662165935347, 0.441740103044691, 1.01214237202473, -1.13365663985256, 0.822008282364716, 1.25660048730189, -0.345958268403933, -1.89419299849261, 0.822008282364716, -1.21514267827828, -0.101500153126774, -1.62329084831369, -1.32093948997712, -1.74423139164832, 0.352071359485254, -0.292944871632769, 0.331914602262816, 0.694736232266704, 0.714892989489142, 1.01724434782572, 0.85599029004621, 0.936617318935963,
+#> 0.775363261156457, 0.815676775601334, -0.434042172189836, -1.07905840330786, -1.90920352931799, 0.321988690460375, 1.25764994391582, 1.32962388648932, -1.40538593130352, 0.321988690460375, -1.6932817015975, 1.04172811619533, 0.106066862739888, -1.40538593130352, 0.681858403327854, 0.681858403327854, 0.609884460754358, 0.609884460754358, 0.537910518180863, 0.25001474788688, -0.109854964980599, -0.397750735274582, -0.829594390715556, -0.381779513613454, 0.809372568860522, 1.17588090192944, 1.08425381866221,
+#> 0.931542013216827, 0.748287846682369, 0.626118402326064, 0.259610069257149, -0.41232187470253, -0.0152711805445382, -0.198525347078996, -0.41232187470253, 0.778830207771446, -1.42021979064205, -1.3591350684639, -2.21432117895803, -1.68206256670698, -0.586084518016369, 1.10769973905094, 1.10769973905094, 1.50623721130207, 1.40660284323929, 0.0117216903603273, 0.11135605842311, -0.386815781890804, -0.187547045765238, -0.586084518016369, 1.10769973905094, 0.509893530674241, -0.187547045765238, -0.785353254141935,
+#> -0.785353254141935, -1.68206256670698, -2.12117930562683, 0.537474833727495, 0.660560673512418, 0.808263681254325, 0.635943505555433, 0.537474833727495, 0.56209200168448, 0.537474833727495, 0.439006161899557, -0.397977548637917, -0.373360380680932, -1.82577329014302, -1.42321158247793, 0.674152854857967, 0.858536541656728, 1.11206411100502, 0.558913050608742, -1.46930750417762, -0.0403339314872288, -0.270813539985679, -1.42392415048375, -1.11931558858061, -0.640644991304235, 0.490758238621735, 1.83973901276424,
+#> 1.40458392433117, 0.360211712091815, -0.597129482460929, 1.18700638011464, 1.53513045086109, 0.795366800524881, -0.249005411714476, -0.901738044364075, -0.945253553207381, -0.423067447087703, 0.012087641345363, -0.640644991304235, -0.684160500147542, -1.78489909430832, 0.998888483970713, 1.24451679970122, 0.589507957753207, 0.425755747266205, 0.589507957753207, 0.671384062996708, 0.589507957753207, -1.94865130479532, -0.80238583138631, -1.21176635760382, 0.589507957753207, 0.425755747266205, 0.0163752210487002,
+#> -0.393005305168805, 0.379255539465811, 0.111545746901709, 1.58394960600427, 0.513110435747862, 0.580037883888887, 0.312328091324786, -0.557728734508545, -1.29393066405983, -1.62856790476495, -1.57970461590507, 0.5609505657552, -0.414001299159379, -0.265639058846291, 1.4087347961157, 1.53590243066978, 1.2391779500436, 0.666923594550263, 0.370199113924087, 0.243031479370011, 0.285420690888036, -1.15581250072482, -0.943866443134694, -1.30417474103791, -0.647141962508518, -1.35173449048449, -0.147404921236128,
+#> -1.20119329432845, 0.00313627491991761, 0.755842255700145, -0.097224522517446, 1.7092698313551, -0.498667712266901, 1.55872863519905, -1.45209528792186, 0.705661856981463, 0.705661856981463, -0.398306914829537, -1.20119329432845, 0.00313627491991761, 0.90638345185619, -1.09345580888911, 1.12732390916443, 1.12732390916443, 1.45632831183903, 0.962821707827133, 0.551566204483885, -0.846702506883157, -1.38133466122938, -0.682200305545858, 0.263687352143612, -1.13458135922343, -0.106442600865311, -1.05233025855478,
+#> 1.12732390916443, 1.00394725816146, -0.970079157886131, -0.35319590287126, 1.2342592920105, 0.904830655352891, 1.38799265578405, -0.65446489149311, -1.20351261925579, -0.303074345724997, 0.926792564463398, -0.500731527719561, -0.742312527935139, -1.04977925548224, -2.38002831485567, -0.211491877790679, 0.768519781267538, 0.914478964531528, 0.747668469372682, 0.747668469372682, 0.726817157477826, -1.02469304169005, -0.711923363267215, -0.0863840064215449, 0.560006662318981, 0.872776340741816, 0.726817157477826,
+#> 0.705965845582971, 0.560006662318981, 0.851925028846961, -1.42086796769231, -0.420004996739236, 0.601709286108692, -0.649369427582648, -1.87959682937913, -1.65301723096879, -0.635030079932291, -0.363566839655892, -0.544542333173491, -0.454054586414691, 0.247225450966006, 0.654420311380605, 1.0842371084849, 1.152102918554, 1.0389932351055, 0.0210060840690071, 0.631798374690905, 0.835395804898204, -2.01496821800399, 0.481030761195203, 1.3279159041445, 1.29027656445787, 1.40319458351778, 1.34673557398782,
+#> 1.38437491367446, -1.13746084533013, 0.688047129471699, 1.3279159041445, 0.42457175166525, -0.591690419873912, -0.328215042067463, -0.77988711830709, 0.161096373858801, -1.17510018501676, -1.38211655329326, -1.13746084533013, -1.26919853423335, 0.123457034172165, 0.650407789785064, -0.459952730970687, -0.836346127837044, 0.368112742135296, -0.497592070657323, -1.38211655329326, -1.32441827729482, -1.97039261125282, 0.158930193275379, 0.398179946593153, -0.51096911601439, 1.13985418187825, 0.924529403892258,
+#> 1.04415428055115, 1.06807925588292, 1.11592920654648, -0.223869412033061, -0.89376872132283, -0.391344239355503, -0.534894091346168, -3.4331214328102, -0.315476023555532, 0.278361197254881, 0.241246370954231, 0.723739112862692, 0.463935328758136, -1.05777254956855, -0.0556722394509763, 0.723739112862692, 0.723739112862692, 0.64950946026139, 0.64950946026139, -1.54026529147701, 0.463935328758136, 0.0927870657516272, 0.389705676156834, 0.501050155058787, 0.463935328758136, 0.0927870657516272, -0.0556722394509763,
+#> -0.65594540488608, 0.939597471863844, 0.301380321163874, -0.0177282541861102, 0.460934608838867, 0.780043184188851, 0.301380321163874, 0.939597471863844, -0.65594540488608, 0.460934608838867, 0.939597471863844, -0.65594540488608, 0.780043184188851, 0.620488896513859, 0.780043184188851, -1.13460826791106, -1.77282541861103, -2.411042569311, -0.268818014656524, 1.38131102915814, 0.18713869481858, 1.48987215046173, 1.12076433802951, 1.29446213211526, 1.20761323507238, -1.4847025732568, -1.72353704012471,
+#> 0.0351531249935454, 0.881929871161595, -0.0951202205707699, 0.599670955772245, -1.4847025732568, -0.529364705785154, -1.09388253656385, -0.963609190999539, -0.529364705785154, 0.252275367600738, 0.0351531249935454, -0.312242463177962, -1.40396121303028, -0.552502256340757, 0.847674694659792, 1.11257303674098, 1.1882582773356, 0.488169801835327, -1.04445632020582, 1.07473041644366, 1.05580910629501, -0.136233433070324, -0.741715357827318, 1.0179664859977, -0.722794047678662, -0.741715357827318, -1.44180383332759,
+#> -1.30846515889573, -0.963598372830191, 0.588302164464748, -1.30846515889573, 1.27803573659583, 0.0710019853664348, 0.243435378399206, -0.963598372830191, 0.760735557497519, 1.27803573659583, 0.933168950530289, 0.415868771431977, 0.760735557497519, 0.933168950530289, -1.82576533799405, -0.101431407666336, -0.79116497979742, -0.991487701522003, -0.357585728417772, 0.27631624468646, 1.75542084859633, 0.27631624468646, 0.910218217790691, 0.698917560089281, 0.48761690238787, -1.62538967462623, 0.27631624468646,
+#> 0.0650155869850492, 0.0650155869850492, -1.83669033232765, -1.32582885863949, -1.49386800422117, -0.115947010451362, 0.741052632015227, 1.0771309231786, 0.690640888340722, 0.942699606713248, 0.320954768061017, 0.438582169968196, -1.27541711496498, -1.54852361017832, -1.39767112564434, 1.7450889688135, -0.291419572395182, 0.663979496320002, 0.0354274774284338, 0.437700769519038, 0.0857116389397593, 1.61937856503519, 1.56909440352386, 1.36795775747856, -0.64340870297446, 0.865116142365304, 0.18627996196241,
+#> -0.291419572395182, -0.618266622218797, 0.311990365740724, -0.316561653150845, -0.417129976173496, -1.09596615657639, -0.894829510531088, -1.37252904488868, 0.653081843789919, 0.912083941232221, -0.194561384203069, 1.10044910300844, 0.582444908123837, -0.924476386085919, 0.959175231676276, -1.48957187141458, -0.0532875128709041, 1.19463168389655, 0.323442810681535, -0.123924448536986, -1.48957187141458, 0.346988455903562, 0.394079746347617, 0.441171036791672, 0.770810069900056, -1.18347848352822,
+#> -2.21948687329743, 0.271474692117159, 0.970793499010961, 0.945817827336183, 0.646109767238839, 0.99576917068574, -0.128136054679299, -1.10218724999567, 0.596158423889282, 1.02074484236052, 1.12064752905963, 1.09567185738485, 0.721036782263175, -0.128136054679299, -1.15213859334522, -1.57672501181646, -0.827454861573102, 0.296450363791938, -0.178087398028857, 0.696061110588396, -1.8764330719138, -0.352917099752307, 0.0217179753693726, -2.07623844531203, -0.716174059220431, 0.449757309190431, 0.260687357556237,
+#> 0.733362236641722, 0.48126896779613, 0.544292285007528, 0.134640723133441, 0.733362236641722, -0.74768571782613, 0.260687357556237, 0.701850578036022, 0.733362236641722, 0.638827260824625, -1.06280230388312, 0.229175698950538, 0.544292285007528, 0.229175698950538, -0.180475862923548, 0.355222333373334, -3.83582826118463, -0.180475862923548, -0.306522497346344, -2.64626330213824, 0.395418654342495, 0.721313149679717, 0.504050152788236, 0.504050152788236, 0.938576146571198, 0.504050152788236, 0.612681651233976,
+#> -0.582264831669169, -0.256370336331947, 0.504050152788236, 0.286787155896755, 0.395418654342495, 0.286787155896755, 0.504050152788236, 0.504050152788236, 0.504050152788236, 0.721313149679717, 0.395418654342495, 0.504050152788236, -0.90815932700639, -1.99447431146379, 0.504050152788236, -2.5376318036925, -0.365001834777688, -1.18022373835252, -0.974048034900124, -1.02559196076322, -0.991229343521157, 1.20797815997112, 1.12207161686595, 1.10489030824492, -1.11149850386839, 1.08770899962388, 0.125555716846013,
+#> 0.709720209961148, 0.572269740992881, -0.647603171100489, -0.47102664135492, 1.09553387371313, 0.841497033431824, 0.799157560051607, 0.629799666530736, -0.13231085431318, -1.36015558233949, -1.40249505571971, -2.16465887615263, -1.75537463486327, 0.245570544773617, 0.291046571583547, 0.745806839682838, 0.791282866492767, 0.427474652013334, 0.791282866492767, 1.1550910809722, -0.482045884185249, 0.381998625203405, 0.609378759253051, 0.563902732443122, -1.25513833995404, -0.345617803755462, -0.987046489084293,
+#> 0.246761622271073, 0.923366070433694, 0.644764238837321, 1.28156842534332, 0.883565808777069, 0.405962668897572, -0.78804518080117, -1.10644727405417, -1.50444989062041, -2.2563316212246, 0.48585242938778, 0.0411739346938797, 0.905826563265352, 1.22698325387761, -0.0823478693877591, 0.312921903673485, -1.66342696163274, 0.782304759183713, 0.955235284898008, 0.634078594285747, -0.971704858775559, -0.724661250612281, 0.0905826563265353, 0.26351318204083, -1.36970052288882, -1.28912990389536, -0.322282475973839,
+#> -0.483423713960759, 1.22870193965026, 1.28912990389536, 1.1481313206568, 1.12798866590844, 0.221569202232015, 0.765420880437869, 0.181283892735285, -0.906419463676424, 0, 0.100713273741825, -1.69198299886266, -0.660564830578423, -1.48099238271235, -0.660564830578423, 1.26231224473548, 1.21103552272711, 0.92901355168107, 0.903375190676884, 0.0573092775387673, -0.865671718611906, -0.12215924949053, 1.057205356702, 0.646991580635031, 1.13412043971455, -0.352904498528199, -0.0965208884863449, -1.27588549467887,
+#> -1.68609927074584, -1.50108455454152, -0.471247113198421, 0.479372063425981, -2.61014026060333, 0.0832807398324799, 0.796245122300782, 0.294529445749014, 0.822651210540348, 0.505778151665548, 0.584996416384248, 0.637808592863381, 0.215311181030314, 0.16249900455118, -0.274385047631952, -1.39869451109946, 1.13100178170244, -0.555462413498829, 2.06792633459203, -0.742847324076747, 0.194077228812844, 0.381462139390762, 0.56884704996868, 0.849924415835558, -0.0870001370540333, -1.21130960052154, -1.3050020558105,
+#> 0.381462139390762, -3.08314948526631, 1.29721553685373, -0.29564447118992, 0.23530886482463, 0.500785532831906, 0.368047198828268, 0.500785532831906, -0.82659780720447, -0.428382805193558, 0.899000534842818, 0.102570530820993, 0.102570530820993, 0.500785532831906, 0.633523866835543, 0.368047198828268, 0.633523866835543, 0.102570530820993, 0.368047198828268, 0.102570530820993, -0.0301678031826448, 0.368047198828268, -2.41945781524812, 0.402090272684362, 0.74113088722591, 0.492501103228775, 0.808939010134219,
+#> 0.605514641409291, 0.628117349045394, -0.411607202215353, 0.10825507341502, 0.628117349045394, -0.298593664034837, 0.492501103228775, 0.763733594862013, 0.6733227643176, 0.718528179589807, 0.537706518500981, -1.31571550765948, -1.18009926184286, -1.97119402910647, -2.42324818182854, -2.3428802141551, 0.61067879406035, 0.764969190011903, 0.764969190011903, 0.764969190011903, -0.293022096513034, 0.280056517021307, 0.787010675147839, -1.50530377898952, 0.853135130555648, 0.853135130555648, 0.412305427836924,
+#> 0.43434691297286, 0.412305427836924, -1.61551120466921, -0.733851799231758, -0.447312492464587, -1.29119445301607, 0.0963577950011992, -0.648809153008075, -0.211987149002638, 1.61238710302007, 1.58669169101975, 0.379007327004717, -0.186291737002319, -0.391855033004877, 1.07278345101335, -1.34258527701671, -0.674504565008395, -1.68001957274897, 1.01666420496826, 0.778721518699095, 0.699407289942706, -1.04550574269786, -1.28344842896703, 0.302836146160759, 0.858035747455485, -0.331677683890356, -0.410991912646745,
+#> 1.09597843372465, -2.84554558564347, 0.429554365515279, 0.457787985783889, 0.683656947932768, 0.937759530350257, 0.683656947932768, 0.514255226321108, 0.514255226321108, -0.445687862811628, 0.514255226321108, 0.2036854033664, -0.360987002005798, -0.0504171790510892, -1.2362292303327, -0.911413831791265, 1.22737062681224, 0.960022569486799, 0.960022569486799, -0.510391745803108, 0.157978397510486, -0.510391745803108, -0.510391745803108, 1.49471868413767, -1.1787618891167, -1.1787618891167, -1.28005536607411,
+#> 0.555413853754189, 0.59446639034628, 0.711624000122554, 1.21930697581974, -0.420899561048096, 0.906886683083011, -0.928582536745284, -1.35816043925829, 0.595555334533939, 0.754370090409656, 0.674962712471797, -1.07199960216109, 0, 0.674962712471797, 0.794073779378585, 0.555851645565009, 0.555851645565009, -1.34992542494359, 0.0397036889689292, -2.22340658226004, 0.379005064033428, 0.558533778575578, -0.0398952698982559, -0.997381747456391, -0.877695937761624, 0.558533778575578, 0.558533778575578,
+#> 0.109711992220203, 0.558533778575578, 0.468769421304503, 0.528612326151887, 0.438847968880812, 0.498690873728195, 0.379005064033428, -3.1218048695385, -1.08810056152525, 0.812681168055404, 0.851472631924397, 0.715702508382921, -0.0601267689969391, 0.560536652906949, 0.482953725168963, 0.579932384841446, 0.851472631924397, 0.366579333561984, 0.8320768999899, -1.86392983890511, 0.618723848710439, 0.715702508382921, -0.816560314442303, -1.59238959182216, 0.405370797430977, 0.754493972251914, -1.18507922119774,
+#> -1.9415127666431, -2.29001644656433, -1.35898083897894, 0.308222458325122, 0.719610284932619, 0.438134403569594, 0.611350330562225, 0.719610284932619, 0.719610284932619, 0.719610284932619, 0.633002321436304, 0.568046348814067, -0.384641249645399, 0.221614494828807, 0.611350330562225, 0.611350330562225, -0.947593012371448, -1.90028061083091, -1.62011523702557, 0.886940666212073, -0.537067086826909, 1.00727934956748, 1.04739224401928, 1.02733579679338, 1.10756158569699, 0.345416591112742, 0.405585932790446,
+#> 0.746545535630765, 0.385529485564545, 0.726489088404864, -1.35938142308886, -0.256276825664292, -0.857970242441327, -1.35938142308886, 0.00445698827242261, -1.70034102592918, 0.55189156958981, 0.985520659981804, 1.0939279325798, 0.55189156958981, 0.877113387383806, 0.00985520659981794, -1.18262479197817, -0.748995701586171, 0.335077024393813, -2.04988297276215, -0.423773883792176, -0.617760008655551, 0.340422663729263, 0.723695732683189, -0.316616883048895, 0.532059198206226, 1.16172209720196, 1.07959215385469,
+#> 0.942708914942574, 0.915332267160151, -0.535630065308281, 0.0119028903401841, -0.0702270530070856, 0.915332267160151, 0.668942437118342, 0.504682550423803, 0.696319084900765, 0.504682550423803, -0.78201989535009, -2.12347563668883, -0.480876769743434, -2.26035887560095, 0.0119028903401841, -1.82233251108217, -0.256322942707107, 0.068521974783088, 0.677606195077203, 0.799423039136026, 0.718211809763478, 0.596394965704654, -1.39328015392279, 0.109127589469362, 0.068521974783088, 0.433972506959557,
+#> 0.718211809763478, 0.840028653822301, 0.109127589469362, 0.190338818841911, -0.66237908956985, -3.01750474137376, -1.20259658217388, 0.859492658153091, 0.84216417714194, 0.824835696130789, 0.790178734108486, 0.530251518941221, 0.547579999952372, -0.33617253161633, -1.5491662023969, -1.30656746824079, -2.23086945957628, 0.556347051958212, 0.655009583339964, 0.803003380412592, 0.679675216185402, -0.183621933404927, 0.507015786267336, -0.676934590313686, 1.04965970886697, 0.482350153421898, 0.408353254885584,
+#> -0.578272058931935, 0.778337747567154, 0.630343950494526, 0.803003380412592, -1.78688806835839, -1.63889427128577, -0.257618831941241, -1.17368786292381, -0.0224271566163785, 0.251682535361583, 0.251682535361583, 0.142038658570398, 0.0872167201748059, -0.680290417363485, -0.241714910198747, 0.0872167201748059, 0.142038658570398, -0.406180725385524, -0.241714910198747, 0.142038658570398, 2.28009425599849, 1.5674090568558, 2.17045037920731, -0.0224271566163785, 0.0872167201748059, -0.0772490950119707,
+#> -1.50261949329737, -1.39297561650618, -1.44779755490178, 1.43115756625292, 0.311121210054983, -1.48972155873386, 0.377005701596039, 0.069544741071114, -0.699107660241197, -2.47836172947723, 0.526194825180861, 0.7264985954914, -0.319532205019194, 0.392658978307168, 0.637474697575605, 0.815522493407195, 0.303635080391373, 0.615218723096656, 0.659730672054554, -0.0969724602297056, 0.370403003828219, -0.252764281582347, -1.89970639302456, -2.07211467235476, -2.05163248448964, -1.00704090336846, 0.611051937976116,
+#> 0.733945065166843, 0.426712247190025, -1.47813122426625, -0.51546839460555, 0.631534125841237, 0.50864099865051, 0.836356004492449, 0.815873816627328, 0.570087562245874, 0.795391628762207, 0.365265683594661, -0.351610891684581, 0.631534125841237, 0.549605374380752, -1.46433964664981, -1.44490656781058, 0.828763656378697, 1.08139368128862, 0.789897498700248, 0.148605897005835, -0.181756443260983, 0.6732990256649, 0.653865946825676, 1.06196060244939, 0.867629814057147, 0.304070527719632, 0.789897498700248,
+#> -0.570418020045476, -0.33722107397478, -1.28944193709679, -1.91130045995198, -2.07066941577865, 0.589154750441782, 0.97370764194353, 0.653246899025406, -0.532457849771652, 0.42892437898272, 0.845523344776281, 0.749385121900843, 0.493016527566344, -1.46179400423421, 0.781431196192656, -1.04519503844065, -0.404273552604402, -1.92583362595401, -0.285023376641193, 0.408276728702249, -1.32497353465636, 0.893586802442659, -0.816553457404498, -0.908993471450291, -0.469903404732777, -1.02454348900753, 1.24023685511438,
+#> 0.63937676381673, -1.55607356977084, -0.400573394198433, 1.03224682351135, 0.778036784885418, 0.824256791908315, 0.63937676381673, 1.10157683404569, 1.07846683053424, 1.07846683053424, -1.57918357328228, 0.593156756793834, 0.154066690076321, -0.169473359083952, -1.56909280802349, -0.86154432695189, -0.591011084189219, -0.50777008641609, -0.403718839199678, 1.11542937015993, 1.36515236347932, 0.241398893542075, 1.40677286236589, 1.44839336125245, -0.174806095323572, 0.428691138531617, -1.50666205969364,
+#> -0.528580335859372, 0.137347646325664, -1.06655864746616, 1.41060982406815, 0.688102353203976, 0.378456294262187, -1.06655864746616, -0.344051176601988, -1.20600636312361, -1.00045343114902, 0.718716545365678, 0.457103722852571, 1.22325556021238, 1.35406197146894, 0.886896216981247, 0.0273112287238959, -1.01914006132853, 0.158117639980449, 0.812149696263216, -1.01914006132853, -1.39287266491868, -1.57012790542691, 0.239975880742105, 0.815917994523157, 0.980472884174886, 0.898195439349021, 0.898195439349021,
+#> 0.15769843591624, 0.569085660045563, 0.569085660045563, -1.24101812612346, -0.747353457168269, -1.57012790542691, -1.94487818209804, -1.62827010594254, 0.0904594503301412, 0.180918900660282, 0.542756701980847, 0.859364778136342, -0.497526976815777, 1.49258093044733, 1.08551340396169, 0, 0.226148625825353, -0.859364778136342, -1.04028367879662, 1.26643230462198, -1.08551340396169, -0.0452297251650706, 1.04028367879662, 0.316608076155494, 0.134701921447948, 0.981399713406476, 1.67212685947791, 1.22649644265763,
+#> 1.96178663041109, 1.96178663041109, 0.780866025837351, -0.867966516397678, 0.0455758380838921, -0.689714349669567, -0.4223360995774, -0.53374370378247, 0.112420400606934, 0.0901388797659199, -0.979374120602748, -0.979374120602748, -1.00165564144376, -1.02393716228478, -0.845684995556664, -0.689714349669567, -0.689714349669567, -0.244083932849289, -2.17703148119283, 1.09554667021859, 1.09554667021859, 0.175134065134126, 0.328536165981536, 1.248948771066, 0.430804233213143, 1.248948771066, 0.37967019959734,
+#> 0.814309485331668, 0.712041418100062, -0.310639254216006, -1.51228904418738, -1.25661887610837, -0.540742405487121, -0.566309422295022, 0.124000031518323, 0.609773350868455, -1.35888694333997, -0.540742405487121, 0.516453852077105, -1.13976022527361, 0.489740721797255, 0.329461940118153, 0.917150806274859, -1.46031778863181, 0.329461940118153, 0.730158894315907, 0.783585154875608, 0.730158894315907, 0.543166982356955, 0.863724545715159, 0.837011415435308, 0.730158894315907, -1.59388344003107, 0.650019503476356,
+#> 0.756872024595757, 0.783585154875608, 0.569880112636806, -0.845915792195259, -1.64730970059077, -0.418505707717654, -1.75416222171017, -1.70073596115047, 0.801193329949174, 0.353960038305904, 0.511807082415293, 0.774885489264276, 0.669654126524683, 0.669654126524683, 0.248728675566311, 0.248728675566311, -2.19790050812923, -0.619430067035332, -1.46128096895208, -1.60648807578949, -0.778903309473692, 0.316429469473687, -1.55780661894738, -0.121703642105264, 0.900606951578956, 1.41176224842107, 0.608518210526322,
+#> 1.11967350736843, -0.85192549473685, -0.559836753684216, 0.778903309473692, 0.924947680000009, -0.584177482105269, -2.59432609329033, -0.751345746112522, 0.528501717205401, 0.810068159135344, 0.758874260602627, -0.44418235491622, 0.298129173808175, 0.784471209868985, 0.426113920139967, 0.37492002160725, 0.682083412803551, 0.477307818672684, 0.195741376742741, -0.418585405649862, 0.554098666471759, 0.451710869406325, -2.13358100649588, -2.1400786524519, -1.49577722338123, -0.812427222851734, -0.714805794204663,
+#> 0.866661349877885, 0.827612778419056, 0.866661349877885, 0.769039921230814, -0.0900286508634099, 0.456651349560187, 0.710467064042571, 0.7495156355014, 0.788564206960228, 0.710467064042571, 0.671418492583743, 0.280932777995459, -1.61292293775772, -0.831951508581148, -2.68353724766001, -0.297890305949089, 0.338282211840491, 0.315561764776577, 0.769970706054849, -0.36605164714083, 0.247400423584837, 0.0201959529457009, 0.679088917799194, 0.815411600182676, 0.860852494310503, 0.792691153118762, 0.792691153118762,
+#> 0.679088917799194, 0.633648023671367, -1.70655802391173, -1.04766505905824, -0.843181035483015, -1.84166332391541, -1.76224868366443, 0.620190523864737, 2.28789796913516, 1.17609300562154, 0.540775883613764, -1.12693156165666, -0.809273000652766, 0.0642880421079301, 0.620190523864737, 0.620190523864737, -0.253370518895959, -1.12693156165666, -0.888687640903738, 0.620190523864737, 0.699605164115709, -0.253370518895959, 0.381946603111819, 0.381946603111819, 0.302531962860847, -0.253370518895959, -2.58660730291319,
+#> -0.574246795048295, 0.594220596615193, 1.24336914753935, 0.853880016984857, 0.724050306800025, 0.983709727169689, -0.768991360325543, 0.00998690078344858, -0.379502229771047, 0.0749017558758646, 0.139816610968281, -0.314587374678631, -2.31274994827157, 0.54135480270653, -0.465976285873975, 0.565338876244161, 0.877131832233365, 0.901115905770996, 0.397450361480743, -0.513944432949237, 0.925099979308627, 0.421434435018374, 0.445418508556005, 0.685259243932316, -1.42533922737922, -1.04159405077712,
+#> -1.87544577057816, 0.941390641033363, 0.0171161934733337, 0.127148865801909, 0.919384106567648, 1.00741024443051, -2.22755032202959, -1.52334121912672, 0.0611292624047637, 0.765338365307643, 0.655305692979068, 0.765338365307643, 0.633299158513353, -0.841138650689551, 0.501259951719063, 0.149155400267624, 0.435240348321918, -0.511040633703826, 0.132955963594678, 1.21831076844919, 1.28343205674046, 1.13148238406083, 0.0244204831092266, 0.719047558216115, -0.0407008051820443, -1.64702591636672, 0.675633366021935,
+#> 0.979532711381199, -1.73385430075509, -1.49507624368709, -0.626792399803482, 0.0678346753034071, -0.49654982322094, -0.192650477861676, -1.87384084499959, -0.0986232023683995, 0.352225722744284, -0.408581838383369, 0.605828243120168, 0.380403780563827, -0.380403780563827, 1.36663580424782, 0.0140890289097714, 1.02849911041331, 1.11303328387194, 0.436759896202912, -1.50752609334554, -0.972142994774224, 0.464937954022455, 1.53570415116508, -0.662184358759254, -1.39481386206736, -1.38118281863238, -2.48612907353828,
+#> -0.10945222336332, 0.515989052998511, 0.641077308270877, -0.463868946635025, 0.307508627544567, 0.620229265725482, 0.682773393361665, 0.724469478452454, 0.682773393361665, 0.265812542453778, -0.382565113674837, 1.21690310028227, 0.842027737636074, 0.692077592577595, -1.05734076643799, -0.207623277773278, 1.26688648196843, -0.882398930536434, -0.332581731988678, 1.56678677208539, -0.357573422831757, -0.907390621379513, -1.45720781992727, -1.27806403954389, -0.274625330811084, 1.13018886141484, 1.02984499054156,
+#> 0.829157248795002, 1.02984499054156, 0.3274378944286, -1.57909565216373, 1.02984499054156, -0.0739375890645225, -1.07737629779733, -0.676000814304206, -1.27806403954389, 0.528125636175161, 0.728813377921722, 0.728813377921722, 0.628469507048441, 0.126750152682039, -1.88012726478357, -1.61782510155589, -0.452792725052414, 0.241269116268805, 1.13363434082466, 0.588300036929414, -0.799823645713024, -0.403216879243756, 1.2575739553463, -0.229701418913451, -1.59303717865156, 1.60460487600691, 1.10884641792033,
+#> 0.166905347555817, -0.204913496009122, -0.799823645713024, -0.884469887667132, 0.674817766146034, 1.17929318355618, -0.104826060760549, 0.445510758232333, 0.583094962980554, 1.04170897880795, 1.40860019146988, -1.75583651773919, -0.884469887667132, -0.746885682918911, 0.812401970894254, -0.655162879753431, -1.11377689558083, -1.87173217956467, 0.508775081228303, -0.303397984218712, 0.172703467939883, 0.760828791194617, 0.732822823420582, -1.01325223336031, 0.317161015600473, 0.830320411628206, 1.17242667564669,
+#> 1.21043848275986, 1.00137354363745, 1.21043848275986, 0.0130665586951506, 1.02037944719403, -0.462081030219416, -0.386057415993086, -0.956234522690566, 0.0510783658083159, -1.65945295428413, -1.31734669026564, -1.0322581369169, -1.89167640194652, -2.13345279414796, 0.14327489908234, 0.566383585434874, -0.0179093623852924, -0.299981819953649, 0.707419814219052, 0.848456043003231, 1.02978833715432, 0.364903258600334, 0.566383585434874, 0.485791454701058, 0.868604075686685, 0.949196206420501, 0.304459160549972,
+#> -0.199241656536379, -0.420870016054373, -1.87152836926306, -1.67705098312484, 0.559016994374947, -0.931694990624912, 0.452537566874957, -0.186338998124982, 1.0914141318749, 1.19789355937489, -0.399297853124962, 1.19789355937489, -0.0798595706249925, -0.825215563124922, -0.505777280624952, 0.665496421874937, -1.99648926562481, 0.452537566874957, 0.984934704374907, -0.755599134571815, 1.37785724539566, 0.735526292287175, 1.21727450711854, -0.434433658017571, 1.42373802776055, 0.414360815732931, -0.549135613929801,
+#> -0.916181872848937, 0.253778077455809, 0.253778077455809, -1.65027439068721, -0.273850919740449, 1.19433411593609, -1.16852617585584, -1.12264539349095, -1.8167578178159, -1.44237171653063, 1.19803552411287, 0.271922536722988, 0.626604106361667, 1.09951286587991, 0.981285676000347, -0.161577159502065, 0.744831296241227, 0.350740663309361, 0.744831296241227, 0.291627068369581, 0.449263321542327, -1.50148531147041, 0.76453582788782, 0.587195043068481, 0.252218005076394, -1.44237171653063, -0.417736070907778,
+#> -1.58030343805678, -2.14585729685127, -1.8504429079922, -0.373370963696875, 0.709815128786365, 0.709815128786365, 0.512872202880322, 1.00522951764543, -0.274899500743853, 0.4144007399273, -1.16114266732105, 0.4144007399273, -1.45655705618011, -0.274899500743853, 0.906758054692409, 0.906758054692409, 0.906758054692409, 0.906758054692409, -0.767256815508962, 0.906758054692409, 0.808286591739387, 0.709815128786365, -1.55502851913314, 0.4144007399273, -0.373370963696875, -1.88725909694347, 0.409455215546338,
+#> -0.870680630759454, 0.673012595668119, 0.898918921486788, 0.936569975789899, 0.57888495991034, 1.01187208439612, 0.898918921486788, -0.117659544697224, 0.673012595668119, -0.080008490394112, -0.00470638178788894, 0.183548889727669, -1.30366775524524, -2.0002122598528, -1.06947155952737, -1.82037712259978, 1.16049041565736, 0.978452703397379, 0.955697989364882, 0.56886785081243, 0.750905563072408, 0.0227547140324972, 0.750905563072408, 0.819169705169899, 0.614377278877424, 0.477848994682441, -0.72815084903991,
+#> -1.16049041565736, -1.04671684549487, -1.27426398581984, -1.87592765637406, 0.281720584437801, 0.815332514961166, 0.908134589834794, -1.24951365097707, 0.397723178029837, 1.16334029573727, -0.0198861589014919, -0.947906907637778, 1.00093666470842, -0.0430866776198991, 0.53692629034028, 0.560126809058687, -1.52791987559796, -1.36417132807485, 0.364062337814368, 0.845701228308084, 0.930696326630504, 0.364062337814368, -0.99585923534436, 0.279067239491947, 0.902364627189697, 0.392394037255174, 0.845701228308084,
+#> 0.760706129985663, 0.647379332222436, 0.307398938932754, 0.590715933340822, 0.505720835018402, -0.712542240936292, -2.01580041521341, -0.485888645409837, 0.279067239491947, -2.44077590682551, -1.30118343219773, -0.325295858049433, 0.650591716098865, -0.375341374672422, 0.350318616360927, 0.875796540902318, 0.375341374672422, 0.700637232721855, 0.325295858049433, 0.875796540902318, 0.325295858049433, -2.47725307283799, -1.66645098777817, -1.62530404980834, -0.925806104321204, -1.37842242198935, -1.29612854604969,
+#> -0.514336724622891, 0.185161220864241, 0.637777538532385, 0.925806104321204, 0.80236529041171, -0.102867344924578, -0.596630600562554, 0.884659166351372, 0.80236529041171, 1.00809998026087, 1.13154079417036, 0.596630600562554, 0.966953042291035, 0.349748972743566, 1.33727548401952, -1.25498160807985, -0.267455096803903, -1.78464641034997, -1.78464641034997, -0.983239154381491, -0.841814344504701, 0.808141770724513, 1.23241620035488, 0.289584134509617, 0.855283374016776, 0.713858564139987, 0.148159324632828,
+#> 0.525292150970934, 0.949566580601303, -0.417539914874332, 0.289584134509617, 0.716061859857276, 0.899536784802913, -0.0637065711616792, 0.303243278729594, 0.417915106820617, -1.00401556150807, 0.372046375584208, 0.578455666148049, -2.21953693927291, 0.306048765869926, 0.803378010408555, 0.803378010408555, -1.28540481665369, -0.788075572115059, 0.405514614777652, 0.703912161500829, 0.803378010408555, 0.902843859316281, 0.803378010408555, -0.688609723207333, -0.589143874299607, -2.18059745682322, -1.81738939051448,
+#> -0.386195245484327, 0.567934184535775, 0.879063346498852, 0.837579458237108, 0.837579458237108, 0.775353625844493, 0.173837246049211, 0.671643905190134, 0.215321134310955, 0.920547234760596, 0.879063346498852, 0.879063346498852, 0.422740575619673, 0.484966408012288, -0.199517748306481, -1.17438912245746, -0.116549971782994, -1.77590550225274, -0.904743848756122, -2.1700024407393, -0.838055520272633, 0.859590137495912, -0.324813809784468, 0.681929545403855, 0.60296928225183, 0.839850071707906, 1.03725072958797,
+#> 0.247648098067716, -1.78557867809694, -1.58817802021687, 0.267388163855722, -1.57678779729276, -1.62876981258813, 0.0346546768635772, -0.883694260021218, 0.623784183544389, 0.987658290611949, 0.970330952180161, 1.02231296747553, 0.953003613748372, -0.311892091772194, 0.329219430203983, -1.3688597361113, 0.693093537271543, 0.762402890998698, 0.779730229430486, 0.675766198839755, -1.5248057819974, -0.537147491385446, -2.03502090343377, -1.44165627716259, -0.101091751142498, 0.448319939849341, -0.0351623482234776,
+#> 0.602155213327056, 0.0527435223352167, 0.558202278047709, 0.99773163084118, 0.821919889723792, 1.04168456612053, 0.821919889723792, -1.83723269467671, 0.250531731092279, -0.145044686421845, -2.15280696267456, -2.34228389279994, 0.689346989206156, -0.186983812623731, -1.34753000964169, 0.831454686800192, -0.44751459154613, 0.476185442815102, 0.00249311750164982, 0.90250853559721, 0.831454686800192, 0.90250853559721, 0.760400838003174, 0.855139303065865, 0.618293140409138, 0.310393128955394, 0.0498623500329951,
+#> -0.518568440343148, -0.234353045155077, -1.4316707215924, -1.18258454144383, -1.04846121367152, -0.0712769684732832, 0.675981571972428, 0.944228227517043, 0.867586325932867, 0.407734916427814, 0.848425850536824, 1.07835155528935, 1.04003060449726, 0.867586325932867, 1.09751203068539, 0.790944424348692, -0.818535508918995, 0.790944424348692, 0.541858244200121, 0.905907276724955, 0.101167310091112, -1.62327547555284, 0.120327785487156, -1.52747309857262, -0.588609804166468, -1.41251024619636, -1.37418929540427,
+#> -1.82967933844513, -0.24666138475144, 0.732310244506497, 0.169922287273214, 0.565676775696636, 1.00308963132252, -1.05899954519952, 0.961431264120057, 0.919772896917591, 0.794797795310195, 0.648993510101566, 0.98226044772129, 0.75313942810773, 0.0866055528682834, 0.232409838076912, -0.434124037162534, -1.66304586963526, -1.93382525645129, -0.684074240377327, -3.24163638571417, 0.393843673030694, -0.878574347530009, -1.06034835046725, 0.393843673030694, 1.12093968477967, 0.575617675967938, -0.151478335781036,
+#> 0.212069670093451, 0.757391678905181, 0.757391678905181, 0.575617675967938, 0.212069670093451, -0.515026341655523, 0.0302956671562074, 0.393843673030694, -0.333252338718279, 0.757391678905181, 1.12855298537376, -0.14106912317172, 1.7633640396465, -0.246870965550509, 0.493741931101019, -1.19908754695962, -0.564276492686879, -1.51649307409599, -0.987483862202038, 0.599543773479809, -0.246870965550509, 0.916949300616178, -2.46551963884844, 0.296044537915915, 0.863842779867464, 0.0637634389357354, 0.734797724878475,
+#> -0.607270847007005, -0.478225792018016, 0.786415746874071, 0.734797724878475, -0.0394726050554553, 0.554134647893892, 0.915460801863059, 0.657370691885082, 0.786415746874071, -0.297562715033432, -0.426607770022421, -2.07838447388147, -1.74303618119568, -2.63889835253648, 0.360292394995755, -0.847174009854883, 0.555045040939406, 0.516094511750676, -0.0292128968915477, -0.068163426080278, 1.10035244958163, 0.438193453373215, 0.632946099316867, 0.944550332826709, -0.41871818877885, 0.710847157694327,
+#> 0.438193453373215, 0.0486881614859128, -1.79460581753145, -0.734430110188691, 0.607016703183779, 0.780106614586678, 0.628652942109141, 0.823379092437403, 0.304109358228705, 0.736834136735953, 0.671925419959866, 0.801742853512041, 0.823379092437403, 0.736834136735953, 0.715197897810591, -0.258432853830718, -1.81624205645681, -0.712793871263328, -1.92442325108362, -0.388250287382892, -1.87896020080104, 0.29864268092202, 0.821267372535554, -0.0497737801536701, 0.472850911459864, 0.908371487804477, 0.908371487804477,
+#> 0.385746796190942, 0.821267372535554, 0.734163257266632, -1.35633550918751, -1.79185608553212, 0.29864268092202, -0.572398471767205, -1.63509921336199, -1.28884290935592, -0.615566762677456, -0.654039685344797, -0.78869491468049, 0.865640760015172, 1.15418768002023, 1.26960644802225, 0.173128152003034, 0.654039685344797, 1.11571475735289, 1.25036998668858, -0.38472922667341, -0.0961823066683525, 0.38472922667341, -1.40426167735795, -1.79690822539211, -1.81806387778819, -0.294856905270376, 0.12825614265124,
+#> 0.932170933702308, 0.614836147761097, 0.826392671721904, -0.612191691211587, 0.847548324117985, 0.720614409741501, 0.318657014215966, 0.741770062137581, 1.18603876245528, 0.191723099839482, -0.379479514854699, -1.60650735382738, -1.00586483294627, -1.44746402789829, -2.23252926336854, 0.760531946861812, 0.907731678512485, 0.0245332886084455, 0.417065906343574, 0.515199060777356, 0.466132483560465, 0.564265637994247, 0.515199060777356, 0.515199060777356, -1.63693317367137, 0.706324948148585, 0.518864298402989,
+#> 1.08124624763978, 0.565729460839388, 0.425133973530191, 0.284538486220994, 0.565729460839388, 1.03438108520338, -1.44947252392577, 0.190808161348196, -1.59006801123497, 0.518864298402989, -1.21514671174378, -2.86724218578975, 0.460492921542857, 0.507362430096838, 0.273014887326936, 0.483927675819848, 0.249580133049946, 0.296449641603926, 0.460492921542857, -0.43002774098277, 0.390188658711887, 0.507362430096838, 0.390188658711887, 0.437058167265867, 0.296449641603926, 0.366753904434897, 0.460492921542857,
+#> -0.148810689658888, 0.507362430096838, -2.82037267723577, 0.179275870218975, -0.832769095735563, 2.28200362597667, 1.04186263492458, -0.429002261439532, 0.638095800628548, -0.40016177327553, 0.320850430824524, -1.06349300104758, 0.724617265120555, -0.890450072063567, 0.66693628879255, -0.371321285111528, -1.3230573945236, 1.07070312308858, -1.03465251288358, -0.40016177327553, -2.64451410655952, -1.91564929564917, 0.388503977551293, 0.270945137081881, 0.741180498959527, -0.011196080044706, 0.435527513739057,
+#> 0.764692267053409, 0.764692267053409, 0.741180498959527, 0.600109890396233, 0.764692267053409, 0.576598122302351, 0.67064519467788, 0.200409832800235, -0.128754920514117, 0.176898064706352, -0.716549122861174, -0.175778456701882, -2.0096963680247, 0.506062818020704, -1.01389369986077, 1.03063251094337, -0.131519229934769, 0.514120626108643, 0.966068525339032, 0.471077969039082, -1.27214964227813, 0.449556640504302, 0.492599297573863, 1.2243244677564, 1.13823915361728, 0.901504539734691, 0.277386012226059,
+#> -1.50888425616072, 0.169779369552157, -0.863244400117303, -0.863244400117303, -1.98235348392589, 0.192139902307606, 0.745502820953513, 0.745502820953513, 0.46882136163056, 0.192139902307606, 0.330480631969083, 0.192139902307606, -1.05292666464568, 0.46882136163056, -2.02131177227602, 0.46882136163056, 1.16052500993794, 0.883843550614989, 0.46882136163056, 0.330480631969083, -1.19126739430716, -2.43633396126045, 0.0537991726461298, -1.28195637477476, -0.478341930886104, -1.28195637477476, -1.52304070794135,
+#> -1.28195637477476, -1.36231781916362, -1.52304070794135, 1.12888695689121, 0.00382673544708882, 0.646718290558012, 1.04852551250234, 0.566356846169147, 0.646718290558012, 0.968164068113474, 0.887802623724609, 0.727079734946878, 1.04852551250234, 0.807441179335743, 0.807441179335743, -0.237257597719508, -0.317619042108373, -1.70164895959539, -0.994601976383784, -0.480385988593528, 0.0338299991967274, 0.997984976303457, 0.997984976303457, 0.740876982408329, 0.612322985460765, 0.997984976303457, 0.483768988513201,
+#> 0.419491990039419, -2.92291193059724, 0.0338299991967274, 0.355214991565637, 0.676599983934547, 0.419491990039419, -0.416108990119746, 0.0338299991967274, -0.287554993172182, -1.76207231081502, 2.84089209294667, -0.179803297021941, 0.251724615830718, 0.467488572257047, 0.323645934639494, 0.467488572257047, 0.323645934639494, 0.179803297021941, -0.6113312098746, 0.251724615830718, 0.179803297021941, 0.467488572257047, 0.323645934639494, -0.251724615830718, -1.5463083543887, -0.467488572257047, -1.25862307915359,
+#> -3.40389248598706, -1.6385948353706, 0.297538071757129, 0.411428242764643, 0.354483157260886, 0.496845871020278, 0.496845871020278, 0.525318413772156, -0.869836181069885, 0.0412851869902233, 0.582263499275913, 0.468373328268399, 0.582263499275913, 0.468373328268399, 0.468373328268399, 0.525318413772156, 0.382955700012764, 0.354483157260886, 0.354483157260886, -0.898308723821764, 0.755511092631141, 0.209429240703451, 0.790742179852282, 0.808357723462853, -1.11173653008935, 0.720280005409999, 0.632202287357146,
+#> -1.30550750980562, -1.4992784895219, -2.10896452916714, -0.66749751117329, 0.954152884069795, -0.397222445299443, -1.20804764292098, 0.864061195445179, 0.954152884069795, 1.04424457269441, 0.773969506820563, 1.04424457269441, 0.954152884069795, -1.20804764292098, 0.143327686448252, 0.864061195445179, -1.47832270879483, -0.126947379425595, -0.0368556908009793, -1.47832270879483, 0.954152884069795, 0.593786129571331, -0.577405822548674, 0.143327686448252, -1.29434679102772, -0.631863917340414, -1.68404259907908,
+#> 0.381345183593113, 0.0306189563468923, -1.41125553344313, 0.186497279567435, 1.27764554211123, 1.27764554211123, -0.242168109289057, -0.437016013314736, 0.732071410839334, 0.576193087618792, 1.2386759613061, -1.37082413603918, 1.0989567794504, 0.907500894528728, 0.75433618659139, 0.850064129052226, -1.42826090151568, 1.1563935449269, 1.1563935449269, -1.10278589714883, -1.007057954688, -0.64329177333682, 0.505443536193216, 0.486297947701048, -0.77731089278199, -0.585855007860318, -1.71743789783038,
+#> 1.19127153062991, 1.28904327612438, 0.115782330190812, 0.506869312168667, 1.06905684876183, -0.177532906292579, -1.27746504310529, 1.14238565788268, 0.849070421399289, -1.25302210673168, 0.849070421399289, 0.115782330190812, 0.18911113931166, -1.64410908870953, -0.470848142775969, 0.629083994036746, -1.03303567936914, -0.373076397281506, -2.47575474016393, -2.185733440523, 0.231110723151361, -0.421437201040717, -0.711458500681641, 0.351952931335079, 0.69031111424949, 0.762816439159721, 0.376121372971823,
+#> 0.786984880796465, 0.69031111424949, 0.666142672612747, 0.569468906065772, 0.279447606424848, 0.279447606424848, 0.110268514967643, -1.44466927246559, -2.27768421586309, 0.852432541145691, 0.170874860184102, 0.524275139201222, 0.372817876765314, 1.33204720552607, -0.308739804196275, 0.170874860184102, -0.636897206140744, 1.07961843479955, 0.271846368474708, -0.106796787615064, -1.32737880812118, 2.00239396993025, 1.59466669098518, -0.172151517776809, 0.371484854149956, -1.39533335461203, 0.235575761168265,
+#> 0.507393947131647, 0.371484854149956, -0.443969703740191, -0.511924250231037, -0.715787889703574, 0.235575761168265, 0.575348493622493, -1.32737880812118, -2.33120692185429, 0.136038600214309, 0.429758305222475, -0.275168986797124, 0.429758305222475, 0.429758305222475, 0.723478010230641, -0.803864455811823, 0.312270423219208, 0.899709833235541, 0.723478010230641, 0.253526482217575, 0.488502246224108, 0.312270423219208, 0.429758305222475, 0.136038600214309, 0.312270423219208, -2.91864633187062, 0.312270423219208,
+#> -0.744196686800345, 1.05754266018996, 2.07591707370623, 1.21421564688477, 0.979206166842559, 1.05754266018996, 0.352514220063321, -0.900869673495154, -1.29255214023218, -0.744196686800345, 0.509187206758131, 0.352514220063321, 0.195841233368512, 0.509187206758131, 0.587523700105535, -0.900869673495154, 0.274177726715917, 0.274177726715917, 0.274177726715917, 0.195841233368512, -1.52756162027439, -1.76257110031661, -1.6058981136218, -0.430850713410726, -1.72363064023944, -1.67307080812575, -0.864113494306707,
+#> -0.206835676828733, 0.475722056706086, 0.24820281219448, 0.627401553047157, 1.2088396223546, 0.728521217274538, 0.779081049388228, 0.399882308535551, -1.80431340713004, -0.898646366197065, -0.224661591549266, 0.407199134683045, 0.49144723151402, 0.428261158890789, 0.807377594630175, 0.702067473591457, 0.175516868397864, 0.828439618837919, 0.765253546214688, 0.849501643045663, 0.617819376760482, -2.20449186707717, -0.940770414612552, -2.34483784026706, 0.56899899658967, 0.712302447582624, 0.7839541730791,
+#> 0.760070264580275, 0.760070264580275, 0.592882905088495, 0.640650722086147, 0.592882905088495, 0.736186356081449, 0.640650722086147, 0.592882905088495, -1.29394586631873, -1.12675850682695, -0.52966079435631, -1.24617804932108, -0.840151604841044, -1.21775970704184, -0.985559762902508, 0.33023992055372, 0.639839846072833, 1.25903969711106, 1.02683975297172, 1.56863962263017, 1.1042397343515, -0.598559856003618, -0.675959837383396, -1.21775970704184, 0.0980399764143856, 0.639839846072833, -0.830759800142952,
+#> -1.14035972566206, -1.63496485795529, 0.386294378954953, -0.348708979921498, 0.248481249165618, -0.0271450104130509, 0.340356669025175, -0.762148369289502, -0.394646689851277, -0.30277126999172, 0.0647304094465055, 1.48879941726963, -0.899961499078837, 0.294418959095397, -0.991836918938393, -1.17558775865751, 1.16723544776118, 1.81036338677808, 1.7644256768483, 0.845671478252735, 0.156605829306062, -0.30277126999172, -1.72684027781484, -1.19981573243296, 0.935725856544182, 0.821612947209526, 0.984631389116178,
+#> 0.919424012353517, 0.625990816921544, -0.694458562522337, -1.34653233014895, 0.169539179582918, -1.21611757662362, -0.231003633640747, -0.289733371007039, -0.0548144215418722, 0.180104527923294, 0.121374790557003, -0.465922583105914, -0.524652320472205, -1.52305785569916, -0.465922583105914, 2.05945612364463, 1.64834796208059, -0.407192845739622, -0.34846310837333, 1.47215874998171, -1.17067943150141, -1.10836219514086, -0.505206954064205, -0.157232776519982, 0.445922464556671, -1.54912948669687,
+#> -1.71151743621751, 1.30425876916575, 1.35065532617165, 1.30425876916575, 0.724301806592049, 1.3738536046746, -0.226827612028827, -1.36354325867329, 0.0747500085094999, 0.167543122521293, -0.110836219514086, -0.43561211855536, 0.422724186053723, -1.32038592047149, -0.16785568550309, 1.09106195577008, 1.02013701823357, 0.0449191271064606, -0.965761232788904, 1.12652442453834, -0.735255185795224, 0.0626503614905898, 1.09106195577008, 1.05559948700183, 0.966943315081179, -0.593405310722191, -1.53316073308104,
+#> -1.1430735766302, -1.60240317881822, 0.269683170789531, 0.840441204206527, 0.749119918859807, 1.04591409623665, -0.301074862627465, -0.00428068525062747, -0.141262613270707, -1.48825157213482, 0.269683170789531, 1.13723538158336, 1.02308377489997, 0.42949542014629, 0.634968312176408, -0.894663217381141, -1.96768832020509, -2.34870931644733, -2.06447060936135, 0.209439047326513, 0.114692811631186, 0.683170225803151, 0.872662697193806, 0.872662697193806, 0.0199465759358583, 0.0199465759358583, 0.777916461498479,
+#> 0.683170225803151, 0.967408932889134, 0.872662697193806, 0.683170225803151, -0.548530838236107, -0.83276954532209, 0.588423990107824, -0.359038366845452, -1.2117544881034, -0.139572631559771, 1.53529894715748, 0.977008420918394, -0.697863157798853, 0.279145263119541, -0.977008420918394, 0.279145263119541, -1.81444421027702, -0.279145263119541, 0.837435789358624, -2.18142925701952, -1.97967857428939, -0.0171946604599542, 0.184556022270175, 0.239578935742028, 0.66142127235957, 0.569716416573148, 0.734785156988708,
+#> 0.716444185831424, 0.66142127235957, 0.698103214674139, 0.643080301202286, 0.66142127235957, -0.127240487403661, -1.6128591511437, 0.147874079955606, 0.526553745381839, -1.20355141801563, 1.05310749076368, 0.702071660509118, 0.651923684758467, 0.300887854503908, -1.7551791512728, -0.275813866628582, -1.33208585187997, -1.50239819823906, -0.778570726212953, 1.00970891055742, -0.0121651675970774, 1.24388838680116, 0.456193784890402, -1.11919541893112, 0.924552737377882, 0.945841780672768, 0.945841780672768,
+#> 0.669084217839257, -0.416656990199901, -1.03403924575158, -2.17164777686096, -0.256931952499752, 0.913172162387655, 0.530228997515412, 0.785524440763574, 0.253658933996571, 0.828073681304934, 0.806799061034254, 0.615327478598133, -1.171740624139, -1.04409290251492, 0.742975200222214, -0.831346699808116, -3.41865284437748, 0.234513467381668, 0.704997007532468, 0.704997007532468, 0.788023514617903, 0.704997007532468, 0.677321505170656, 0.760348012256092, 0.73267250989428, 0.594294998085221, 0.151486960296233,
+#> -0.623427105834496, -0.595751603472684, 0.0684604532107979, -0.0975925609600727, 0.317539974467104, -1.01088413889986, -0.152943565683696, -0.540400598749061, -1.15707907811401, 0.437171561340816, 0.567847843263343, 0.254224766649279, 1.37804079118301, -1.15707907811401, -1.20934959088302, -0.242345104656322, 1.45644656033652, 0.593983099647848, -0.921861770653461, -1.95105491423143, -0.524477127481567, 0.466201891094726, 0.307693248122519, 0.624710534066933, -0.881121574169032, 0.54545621258083,
+#> 0.78321917703914, 1.10023646298355, -0.167832680794101, 0.981354980754399, 0.78321917703914, 0.624710534066933, -0.207459841537153, -1.3962746638287, -1.91142775348838, 0.822846337782192, -2.32992024586863, 0.93610813432234, -0.397903457586646, 0.913107934461841, 1.07410933348534, 0.591105136414844, -0.581905056470644, -1.06490925354114, 0.821107135019842, 0.568104936554344, 0.660105735996343, 1.05110913362484, -0.788906855215142, -1.17991025284364, -0.397903457586646, -1.63991425005363, 0.821107135019842,
+#> 0.683105935856843, -0.144901259121148, 0.407103537530846, 1.51489410233493, 0.824676079377595, -1.44318313891079, 1.56419538968902, -0.358554817120693, 0.528868355253023, -0.161349667704312, -0.703663828599361, -0.013445805642026, -0.999471552723933, -0.752965115953456, -2.16408200732665, -1.41027633061167, -1.5205893564724, 0.336346578849869, 0.612129143501691, 0.409888596090355, 0.59374363919157, 0.777598682292784, 0.777598682292784, 0.428274100400476, 0.759213177982663, 0.152491535748655, 0.446659604710598,
+#> 0.446659604710598, 0.354732083159991, 0.72244216936242, -1.72282990388373, -0.311250312267412, 0.149980720419012, 0.73700203474719, 0.590246706165145, 0.883757363329234, 0.716036987806898, 0.170945767359304, 0.401561283702517, 0.548316612284561, 0.485421471463685, -0.143529936745076, -2.05134920831165, -2.1771394899534, -3.12614410255495, -1.10343678507556, 0.619610189073547, 0.64458188435107, 0.49475171268593, 0.619610189073547, 0.669553579628593, -0.554059488970048, 0.544695103240977, 0.170119674078127,
+#> 0.544695103240977, 0.394864931575837, 0.220063064633174, -0.853719832300327, 0.444808322130884, 0.270006455188221, -1.34776456469647, 1.43761553567623, -0.359403883919057, 0.0898509709797644, 0.539105825878586, 0.359403883919057, 0.539105825878586, 0.628956796858351, 1.34776456469647, 0.718807767838115, 0.359403883919057, 0.718807767838115, -1.43761553567623, -1.34776456469647, -0.628956796858351, -1.61731747763576, -1.08088869032349, 1.41439709663149, 0.871943664684751, -1.18937937671284, 0.763452978295404,
+#> -1.94881418143827, -0.104472512819371, -0.321453885598065, 0.112508859959323, -0.321453885598065, -1.62334212227023, 0.437980919127364, 0.871943664684751, 0.654962291906057, 0.00401817356997592, 0.763452978295404, 0.871943664684751, 0.763452978295404, 0.871943664684751, 0.654962291906057, -1.94881418143827, -0.104472512819371, 0.871943664684751, 0.763452978295404, 0.437980919127364, -0.755416631155452, -1.73183280865957, -1.52225699857442, -0.694622125563085, 0.960647620459586, 1.85725206622187,
+#> 0.546830183953918, 0.753738902206752, 0.546830183953918, -0.487713407310251, -0.76359169831403, -0.349774261808362, -0.76359169831403, 0.891678047708641, 0.477860611202973, -1.45328742582348, -1.67978488221639, -0.41908035205811, 1.03557872120144, 1.08406735697676, 1.42348780740399, -1.38885306756448, -1.09792125291257, 0.162783277245712, 0.938601449650808, -0.41908035205811, -0.128148537406199, 0.599180999223578, -0.806989438260658, 0.696158270774215, 0.35878907972457, 0.244281926620984, 0.9313248452425,
+#> 1.04583199834609, 0.35878907972457, 0.587803385931742, 0.129774773517398, 0.702310539035328, 1.04583199834609, 0.473296232828156, -0.213746685793361, -1.70233967613998, -0.900789604414878, -0.786282451311291, -2.27487544165791, -0.52341759300957, -1.13972841071709, -1.54167024835242, 1.08434975753177, 1.05755363502275, -0.550213715518593, -1.5148741258434, 0.360854449788168, -1.40768963580731, 0.521631184842302, 0.736000164914481, 0.762796287423504, 0.548427307351325, 0.977165267495683, 0.628815674878392,
+#> -1.53770224197817, 0.524543288151432, 0.373647273751705, 0.599991295351295, 0.977231331350613, 0.977231331350613, 0.801185981217598, -1.28620888464529, 0.172452587885402, 0.876633988417461, -1.96524094944406, -0.783222169979535, 0.54969262388472, -0.280235455313779, 1.92123985063817, 1.71165004875037, 1.39726534591867, 2.34041945441377, -0.0698632672959336, -0.646235222487385, -0.279453069183734, -0.331850519655684, -0.279453069183734, -0.122260717767884, -1.27500462815079, -0.908222474847135, -0.122260717767884,
+#> -0.855825024375185, -0.122260717767884, -0.174658168239834, -0.0698632672959336, -0.331850519655684, -0.122260717767884, -1.32740207862274, -0.331850519655684, -2.01307487076955, -0.56691268943032, 0.156168401239296, 0.628952191292505, 0.211790023598497, -1.20656134656113, 0.768006247190508, 0.573330568933304, 0.267411645957698, 1.12954679252532, 0.601141380112905, 0.934871114268112, -1.48466945835714, -1.39010879489954, -0.191321593723107, 1.2435903592002, 1.15277314698986, 1.2435903592002, -0.118667823954839,
+#> -0.808878636753391, 0.934811837685057, 0.480725776633378, -1.28112814024714, 0.171947255118236, 1.09828281966366, -0.118667823954839, -1.31745502513127, -1.09949371582647, -2.63588659837772, 0.537708101485042, 0.727581288656319, 0.754706029680787, 0.727581288656319, 0.646207065582915, 0.754706029680787, 0.591957583533978, 0.320710173289298, 0.347834914313766, 0.591957583533978, -1.33389902920325, 0.510583360460574, -0.384533093346871, -0.221784647200062, -1.7136454035458, -0.221784647200062, -1.14053457377653,
+#> 0.688777540113716, 0.73131968229721, 0.965301464306428, 1.07165681976516, 0.944030393214681, 0.986572535398175, 1.00784360648992, 1.02911467758167, -0.58748672539111, 0.667506469021969, 0.667506469021969, -0.523673512115869, 0.795132895572451, -1.88502206198768, -0.523673512115869, -0.438589227748881, -0.927823862859064, -1.01290814722605, -0.778926365216834, -1.73612456434545, -2.21885391039244, -1.47877222993553, 0.503589414145495, -0.368649709250155, 0.10711708532929, -2.16599093321695, -0.844416503829601,
+#> 0.9000617429617, 0.424294948382254, 0.450726436970001, 1.00578769731269, 1.00578769731269, 0.820767277198459, 0.239274528268025, 0.63574685708423, 0.741472811435218, -0.157197800548179, 0.397863459794507, 0.00139113097830251, -1.41649973920266, -0.211417871522785, 0.936279145315191, -0.0392633189970885, 0.936279145315191, 0.764124592789495, 0.764124592789495, 0.878894294473292, -0.383572424048481, -1.58865429172836, 1.56751250457608, -1.47388459004456, -1.07219063415127, -0.0392633189970885, -1.41649973920266,
+#> 0.936279145315191, 0.591970040263798, 0.649354891105697, -0.383572424048481, -1.73995464434136, 0.197624478122722, 0.906494888780311, 0.670204751894448, 0.197624478122722, 0.575688697140103, 0.292140532877067, 1.19004305304335, -0.983826206306594, -1.64543858958701, 0.33939856025424, 0.398526698493043, 0.797053396986086, 0.265684465662029, -1.46126456114116, 0.448712226969998, -0.548426055185553, 0.889754159461877, 0.928105631852475, 0.678821061313587, 0.889754159461877, 0.985632840438372, 0.582942380337092,
+#> -1.37298271158341, 0.813051214680681, -0.20326280367017, -1.35380697538811, -1.10452240484923, 0.256954865017008, -1.89072758885649, -1.41173179828543, 0.719009075797071, 0.819515720800963, 0.85971837880252, 0.759211733798628, -0.547374651251964, -1.21071850827765, 0.61850243079318, 0.698907746796293, -0.0649427552332838, 0.658705088794736, -2.0951769843119, 0.196374521776835, -2.22028356808003, -2.07447024324475, -0.991285544468401, 0.0710686793314798, 0.0918991543079481, 0.90428767839021, 0.633491503696123,
+#> 0.737643878578464, 0.716813403601996, 0.612661028719654, 0.716813403601996, 0.737643878578464, 0.758474353554932, -1.17875981925662, 0.0710686793314798, 0.258542954119694, 0.154390579237353, -2.26280941746, 0.482673633078551, 0.748365541195185, 0.659801571822973, 0.814788518224343, 0.659801571822973, 0.814788518224343, -1.57643865482536, -0.912208884533775, 0.704083556509079, 0.748365541195185, 0.504814625421604, 0.172699740275812, -0.86792689984767, -0.690798961103247, -1.16003273416486, 0.793706607586482,
+#> -0.0610543544297294, 0.793706607586482, 0.63089499577387, 0.264568869195494, 0.712300801680176, 0.91581531644594, 0.590192092820717, 0.753003704633329, 0.590192092820717, -0.427380481008106, 0.142460160336035, -0.427380481008106, -2.54393143457206, -1.56706176369639, -1.46279896874081, 0.665179185175121, -1.55952524846427, 1.3035726313499, 1.14881058379238, 1.12946532784769, -0.669643475008511, -0.108631052612492, 0.0654762508897211, 0.142857274668482, -0.224702588280634, 0.800595976787953, -1.23065589740453,
+#> -1.43850515544023, 0.364178520364615, 1.05611770905738, 1.01969985702092, 1.05611770905738, 1.11074448711208, 0.546267780546922, 1.183580191185, 0.764774892765691, -0.0910446300911537, -1.31104267331261, -1.58417656358607, -1.12895341313031, -0.673730262674538, 0.327760668328153, -0.273133890273461, -0.928655226929768, -1.54300892365998, -1.86841259742977, 0.14143362291301, 0.619968437280338, 0.715675400153803, 0.887947933326041, 0.792240970452575, 0.94537211105012, 0.734816792728496, 0.600827044705644,
+#> -0.624222080074714, 0.619968437280338, 0.811382363027269, 0.217999193211782, 0.773099577877882, -1.16018107216612, -1.44730196078652, -1.2176052498902, -2.69333271553301, -2.58459212565811, 0.220915093114267, -0.562017153985, 0.503640626789002, 0.503640626789002, 0.63412933463888, 0.286159447039206, -0.58376527195998, 0.481892508814023, 0.764618042488758, 0.460144390839043, -0.127054794485407, 0.590633098688921, 0.677625570588839, 0.329655682989165, 0.416648154889084, 0.373151918939124, 0.307907565014186,
+#> 0.35826531204683, 0.35826531204683, 0.432229763566175, 0.506194215085521, 0.543176440845193, 0.506194215085521, 0.506194215085521, 0.543176440845193, -0.0485391713095705, 0.543176440845193, 0.506194215085521, -2.97013500632372, -1.93463268505288, 0.0993897317291205, -0.159485848588589, 0.210336409008139, -1.41647040287775, -0.329411721599476, 0.342588190463455, 0.876235179454605, -0.329411721599476, 1.25176454207801, -1.15952926003015, 0.54023522342314, 1.15294102559816, 1.07388221241429, -0.685176380926909,
+#> -1.3176468863979, -1.3774983458955, -0.0688749172947751, -0.018543246963978, -0.723186631595137, -1.3523325107301, 0.660934302501782, 0.610602632170985, 0.585436797005587, 1.16425100580975, 0.610602632170985, 0.660934302501782, 0.988090159651963, 0.635768467336384, 0.761597643163377, 0.887426818990369, 0.333778445351601, -0.572191620602746, -1.70465420304568, -2.08214173052666, -2.05570927500041, -0.682006082395538, -0.136885767869797, 0.321015296331826, 1.12779336182992, 0.931550048600656, 1.12779336182992,
+#> -1.13990714659716, -0.158690580450827, 0.6698922976283, 0.931550048600656, 0.975159673762715, 1.10598854924889, -1.11810233401613, -0.202300205612886, 0.277405671169766, -0.420348331423183, -1.55419858563672, -1.91940416125567, -1.96341597641822, -0.863120597354461, 0.369210227196951, -1.17120330349231, -0.885126504935736, -0.511026076054058, 1.11741108496031, 0.479239765103327, -0.0268961092660032, 1.09540517737903, 1.31546425319178, 0.3251984120344, 0.699298840916079, 0.435227949940776, 0.87534610156628,
+#> 0.259180689290575, 0.369210227196951, -1.49931291639623, 0.0635302083218739, -0.92754104149936, 1.09271958313623, 1.09271958313623, 1.32142833309498, 1.28331020810185, 1.16895583312248, 0.749656458198113, -1.27060416643748, 0.101648333314998, -1.04189541647873, 0.825892708184361, -0.470123541581867, -0.0508241666574993, -0.241414791623121, -0.889422916506236, -1.3087222914306, 0.605722699043215, 0.347968359024826, 0.347968359024826, 0.154652604011034, 0.605722699043215, -0.554171831039536, 0.412406944029423,
+#> -0.23197890601655, 0.541284114038618, 0.47684552903402, -0.296417491021147, 0.154652604011034, -3.38946957124182, 0.47684552903402, 0.347968359024826, -2.95793418535199, 0.18746584160674, -0.189982161628308, 0.615240245273127, -0.441614163785006, -1.32232617133345, -1.85075337586252, 0.413934643547768, 0.564913844841788, 0.615240245273127, 0.590077045057457, 0.816545846998486, 0.816545846998486, 0.464261043979108, 0.665566645704467, -0.617756565294695, 0.640403445488797, 0.590077045057457, 0.23779224203808,
+#> 0.16230264139107, -2.18150256583986, 0.0405053526813767, -1.32510368057647, 0.433985921586179, 1.12836339612406, 0.87375832212684, 1.22094705939578, 0.688590995583404, 0.596007332311685, -1.20937410148682, -0.700163953492368, 0.248818595042742, 0.433985921586179, -0.0983701422262005, 0.85061240630891, -1.00106085912545, 0.343095019708995, 0.911910447121275, 0.586873060028544, 0.261835672935812, 0.830651100348093, 0.74939175357491, -0.469498448022835, -1.6071293028474, -1.6071293028474, -1.74366874137717,
+#> -1.9844263500192, -0.580006966273995, 0.142265859652112, 0.663907345043189, 0.583654808829177, 0.784286149364207, 0.543528540722171, 0.383023468294148, 0.824412417471213, 0.383023468294148, -2.6865517028703, 1.07768103296587, 0.496214187592806, 0.710438814835515, 0.679835296657985, 0.710438814835515, 0.251386042172567, 0.557421223947866, -1.03396172128369, -0.177063212312852, 0.251386042172567, 0.435007151237746, -0.207666730490382, -1.06456523946122, -1.18204268635361, 1.16979353934477, 1.61076283166321,
+#> -0.520588747875943, 1.56176624362783, -0.667578511982092, -1.13304609831823, -0.937059746176698, -0.275605807699029, -0.226609219663646, 0.38584813077864, 0.2143600726548, -1.46993073975847, 0.597159363026877, 0.597159363026877, 0.597159363026877, 0.49872650098948, 0.597159363026877, 0.49872650098948, 0.49872650098948, 0.301860776914685, 0.49872650098948, 0.49872650098948, -1.56836360179586, 0.301860776914685, 0.104995052839891, -2.55269222216984, -2.20588163401134, -1.53452635409484, 0.75734167044767,
+#> -0.0297645197992536, 0.572140213918982, 0.502689667720724, -0.00661433773316757, 0.502689667720724, 0.456389303588552, 0.849942398712014, 1.10459440143896, 0.803642034579842, -0.840020892112263, -0.932621620376607, -0.910546941634877, -1.09265632996185, -1.27476571828883, 0.801281308638692, 1.27476571828883, 0.946968819300272, 0.946968819300272, 1.05623445229646, -0.327796898988556, 1.01981257463106, -0.728437553307901, -0.728437553307901, -0.983390696965667, -2.19365179004705, -0.489733713683146,
+#> 0.674969781552937, 0.69653836479805, 0.739675531288275, 0.739675531288275, 0.739675531288275, 0.739675531288275, 0.739675531288275, 0.739675531288275, 0.114186617180008, 0.653401198307825, 0.653401198307825, -0.662282379644047, -1.48188854295833, -0.791693879114723, -1.611300042429, 0.0805822964025379, 0.60126790392663, 0.644658371220304, 1.29551538062542, 0.0371918291088636, -1.30791265699504, -1.35130312428871, 1.19713073675847, 0.574688620534673, 1.28934438360644, 1.1049170899105, -1.56927866868064,
+#> -0.485768318216987, -0.347447847945031, 0.782169325942606, -1.3848513749847, -1.03905019930481, 0.736062502518621, 0.413314738550725, -0.186073965961083, -1.08515702272879, -1.45296631451356, 0.458831467741124, 0.535303379031311, 0.84119102419206, -0.305887645160749, 0.458831467741124, -0.382359556450936, -1.52943822580375, 1.37649440322337, -2.17445058848713, -1.91069999570137, 0.848536974980434, 0.807959960705701, 0.807959960705701, 0.584786382194673, 0.807959960705701, 0.8688254821178, 0.381901310821011,
+#> -0.14559987475051, 0.0167081823484193, 0.625363396469406, 0.422478325095743, 0.70651742501887, -0.47021598894837, -1.18031373875619, -0.997717174519891, -3.13844480428826, -0.623881235010173, 0.471572201110976, 0.571158877121989, 0.620952215127496, 0.645848884130249, 0.695642222135756, 0.745435560141263, 0.670745553133002, 0.695642222135756, -0.474501220993653, 0.272398849088949, 0.247502180086195, -0.574087897004666, 0.347088856097209, 0.098122166069675, -1.27119462908176, -1.38384450525589, -1.18540642525694,
+#> 1.34467909472979, 1.89038381472692, 1.89038381472692, 1.54311717472874, -0.193216025262144, -0.143606505262404, -0.143606505262404, -0.0443874652629248, -0.0443874652629248, -0.143606505262404, -0.0939969852626644, -0.0939969852626644, -0.0939969852626644, -0.0939969852626644, -0.73892074525928, -0.937358825258238, -1.33423498525616, -1.98574997910508, 0.0722090901492758, 0.180522725373189, 0.397149995821016, 0.722090901492757, 1.15534544238841, 0.83040453671667, 0.50546363104493, 1.0470318071645,
+#> -0.144418180298551, 0.83040453671667, -0.144418180298551, -1.66080907343334, -1.55249543820943, -0.252731815522465, -2.43265456223815, 1.01360606759923, -0.70952424731946, -0.912245460839306, 0.810884854079383, 1.01360606759923, -0.506803033799614, -0.70952424731946, 0.608163640559537, 0.506803033799614, 0.810884854079383, 0.608163640559537, 0.70952424731946, 0.608163640559537, -0.101360606759923, -1.317687887879, -1.12685859893324, -0.591032463993803, -0.126649813712958, 1.44510684877606, 1.44510684877606,
+#> 1.19505465247099, -0.805362917969577, -1.23402382592113, -0.591032463993803, -0.090928071383662, 0.48061980588507, -1.74271256358217, 0.505697842110897, -0.835790719268999, 0.826899328638477, 0.826899328638477, 0.902476148997908, 0.770216713368904, 0.883581943908051, 0.826899328638477, -1.21367482106615, 0.675745687919616, 0.770216713368904, 0.505697842110897, -1.42151107705459, -0.098916720764549, -0.552377642921133, -1.62934733304302, -1.6625, -0.8125, -1.5875, 0.5125, 0.7125, 0.6625, 0.9625, 1.1125,
+#> 1.0625, 0.3625, 0.8625, -0.5625, -1.4375, -0.5125, 0.8625, -0.5375, -0.883355284710006, -0.761606470584584, 0.252966980460599, 0.273258449481503, 1.40958071465211, 1.08491721031765, 0.638504891857768, 1.32841483856849, 1.22695749346397, -0.578983249396451, -1.79647139065067, -0.923938222751813, -0.13257093093657, -0.0311135858320522, -1.10656144393995, -1.58287962830715, -1.80529831144165, 0.107502363515005, 0.685790939664691, 0.908209622799185, 0.908209622799185, 0.596823466410893, 0.908209622799185,
+#> 0.908209622799185, -0.381818739380882, -0.337335002753983, -0.915623578903668, -0.912763012357341, -0.836188934139443, 1.27725562467453, 0.909700049228625, 1.29257044031811, 0.879070417941466, -1.00465190621882, 0.143959267049648, -0.820874118495864, -0.928077828000921, 0.273475172056941, 1.27399409421648, 1.14059157126188, 0.807085263875363, 1.00718904830727, -0.99384879601181, -1.06055005748911, -1.12725131896642, -0.860446273057205, -0.460238704193388, -0.942378295782838, 0.542375997572857, 0.888140696025553,
+#> 0.298306798665071, 1.05085349529741, -0.637291797148106, 0.0338984998483036, -1.898315991505, 0.908479795934535, 0.176272199211178, 0.989836195570463, -1.41017759368943, -1.66072838003096, -2.04229616975361, -1.55170901153878, 0.792207411043217, 0.828547200540612, 0.337960042325776, 0.737697726797124, 0.701357937299729, 0.610508463556241, -0.134457221140363, 0.774037516294519, 0.755867621545822, 0.283450358079683, -0.697723958349989, 0.265280463330985, -1.66232095098395, -1.14250723341242, 0.709329135436147,
+#> 1.13167778096301, 0.189515417864619, 1.09918942361479, 0.839282564829029, -0.265321585010467, -1.01255380401954, 0.25449213256106, 0.93674763687369, -1.07753051871598, -2.65537275595435, -0.603090672695043, 0.388461345059454, 0.526817440560081, 0.849648330061545, 0.157867852558408, 0.803529631561336, 0.6190548375605, 0.688232885310813, 0.711292234560918, -0.23414108469337, -0.0957849891927422, -1.15651505469755, -1.27607954405512, -1.27607954405512, 0.900524488368014, -0.314981659608543, 1.09839758222466,
+#> 0.787454149021357, 0.0807645281047547, -0.0480275814017872, 0.912524046633956, 0.528303395419659, 0.912524046633956, 1.00857920943753, 0.240137907008936, -0.720413721026807, -0.912524046633956, -0.240137907008936, -1.00857920943753, 0.144082744205361, 1.20068953504468, 1.29674469784825, 1.00857920943753, -1.68096534906255, 0.33619306981251, -1.58491018625898, -1.39279986065183, -2.3777188226929, -0.751175875526206, -2.49226410066239, 0.256822570605268, -0.682448708744515, 0.142277292635782, 0.211004459417474,
+#> 0.715003682483211, 0.921185182828286, 0.737912738077108, 0.692094626889314, -0.224267596866572, 0.715003682483211, 0.600458404513725, 0.623367460107623, -0.659539653150618, 0.417185959762548, 0.531731237732034, 0.623367460107623, 0, -1.97892375813378, -0.395784751626756, 1.97892375813378, 0.527713002169008, 0.395784751626756, 0.527713002169008, 0.395784751626756, 0.527713002169008, -0.659641252711261, -0.131928250542252, -1.18735425488027, -0.665327971558971, 0.985241769730183, 1.41179350062513,
+#> 1.43033922805535, 0.447415674253942, -1.11042542988414, -0.924968155581984, -0.312959150384882, -0.683873698989186, 0.985241769730183, 0.595781493695664, 1.26342768118341, -1.184608339605, -0.461324969826603, -1.42570279619779, -0.350050605245312, -1.43720018679722, 1.35735573197516, 0.019961113705517, 0.259494478171721, 0.19961113705517, 1.23758904974205, 0.279455591877238, -1.47712241420826, -0.439144501521374, -1.37728330511732, -1.84083496768107, 0.418979387317242, 1.23019479680382, 1.17225083898335,
+#> 0.901845702487822, -0.952360947767206, 0.148574250821717, 1.01773361812876, -0.0638869278533383, 0.476923345137712, -0.546753243023919, -0.585382548237565, 0.633551460195105, 0.612147694647973, 0.976011708949216, 0.976011708949216, -1.33559497014103, -0.821904597009866, -0.286810458331568, -1.33559497014103, 0.847589115666424, 0.890396646760688, 0.847589115666424, 0.141264852611071, -2.17034182647918, 0.141264852611071, -0.115580333954513, -1.20143072816019, -1.54741236190252, -0.855449094417856,
+#> 0.448635525072476, 1.00752893342548, -0.40301157337019, 0.768003186988476, 1.00752893342548, 1.16721276438348, 0.395407581419809, 0.634933327856809, 0.368793609593476, 0.0494259476774763, -1.84016605199219, -2.13882210510486, -1.35362731386154, 0.598748923824534, 0.726077808891017, 0.853406693957501, 0.726077808891017, -0.844311773595609, -1.20507694795065, -0.292553271640849, 0.30164819200274, 0.68363484720219, 0.980735579023984, 0.810963732268673, 0.153097826091843, -2.0470739723923, -0.803282191698245,
+#> 0.555675494615632, 0.739940943607344, 1.03937229821888, -0.388684931466893, -0.135319939103289, -2.00100761014437, -0.503850837086713, 1.06240547934284, 1.06240547934284, -0.0662203957313965, 1.0854386604668, 0.578708675739596, -0.158353120227253, -0.0201540334834685, -3.06378440325289, 0.438424694453631, -0.21532100378492, -0.775674459417964, 0.765297543572907, 0.718601422270153, 0.625209179664646, 0.625209179664646, 0.625209179664646, 0.29833633054537, 0.0181596027288485, -1.47611627895927, 0.531816937059139,
+#> -0.869066702023471, 0.625209179664646, 0.858689786178414, 0.251640209242617, 0.0181596027288485, 0.242533994561178, -1.29028085106547, -1.1738645336761, 1.11565637498142, 0.552977507599485, 0.747004703248428, 0.844018301072899, -1.03804549672184, -2.06006347245258, -1.20695483444869, 0.576817772286722, 0.596206604968628, 0.634984270332441, 0.790094931787694, 0.693150768378161, 0.712539601060068, 0.731928433741974, 0.790094931787694, -1.22634366713059, -0.450790359854329, 0.712539601060068, 0.673761935696255,
+#> 0.596206604968628, 0.634984270332441, 0.402318278149562, -2.19578530122592, -0.567123355945768, -0.838567013492461, 0.200346311174534, 0.970691986535769, 1.02994934617894, 1.16821651867968, 1.18796897189407, 0.871929720463816, 0.733662547963081, -0.21445520632767, -0.451484644900358, -1.32059258633355, -0.728018989901827, -1.59712693133502, -0.708266536687436, -1.14282050740403, -2.50543412405097, -2.0794542729819, -1.58957744425247, 0.391228863218697, 0.412527855772151, 0.689414758967046, 0.582919796199778,
+#> 0.28473390045143, 0.668115766413592, 0.732012744073952, 0.604218788753232, 0.582919796199778, -0.0347509878503715, 0.604218788753232, 0.540321811092871, 0.540321811092871, 0.433826848325604, 0.0504449823634423, -0.908009682541963, -2.64221199108853, -0.212148408043604, 0.62487349278298, -0.0771448756522198, 0.62487349278298, -0.320151233956712, 0.894880557565749, -1.07617101534847, 0.921881264044026, 0.759877025174364, -0.0771448756522198, 0.678874905739533, 0.732876318696087, -0.833164657043973,
+#> -0.975010111268398, -0.628339849484079, -1.23501280760664, 1.01834389399144, 1.10501145943752, 1.10501145943752, -0.801674980376238, -0.541672284037999, -0.801674980376238, 0.758341197653198, 0.758341197653198, 1.01834389399144, 0.758341197653198, 1.01834389399144, -1.23501280760664, -1.32168037305272, -1.23093729796602, -1.19340872180852, -1.79386594032853, 0.983248695326515, 0.795605814539012, 0.64549150990901, 0.457848629121507, 0.607962933751509, 0.607962933751509, 0.68302008606651, -0.142608589398502,
+#> 0.532905781436508, 0.570434357594009, 0.382791476806506, -1.90645166880103, -0.658585559938142, 0.658585559938142, 0.768349819927832, 0.548821299948452, 0.987878339907213, -0.987878339907213, -0.878114079917523, 0.987878339907213, 0.987878339907213, 0.878114079917523, -1.64646389984536, -0.658585559938142, -1.97575667981443, -1.42693537986597, 0.439057039958761, -0.10976425998969, 0.548821299948452, 0.658585559938142, 0.878114079917523, -0.734051507130307, 0.760267632384961, 0.0524322505093077, 0.838916008148922,
+#> 0.838916008148922, -0.812699882894268, 0.367025753565153, 0.760267632384961, 0.681619256620999, -1.75648039206181, -1.52053526476992, 0.367025753565153, 0.917564383912884, 0.838916008148922, -1.59918364053388, -1.39037559093815, 0.716133195332562, 0.548569996424664, 0.452819597048723, 1.07519719299234, 0.644320395800606, -0.121682799206925, 0.883696394240459, 0.333131597828796, 0.165568398920899, -1.4621883904701, -1.84518998797387, -2.29390464526354, -0.383566028208664, 0.919959145781719, 0.807586285954962,
+#> -1.17017604699596, 0.650264282197502, 0.875010001851016, 0.762637142024259, 0.672738854162853, -0.00149830479769001, 0.62778971023215, 0.62778971023215, 0.133349126994419, -1.43987091058018, -0.78810832358499, 0.179042582027092, 0.976595901965958, -0.618510737911773, 1.09053209052865, 0.976595901965958, 0.976595901965958, 0.748723524840568, 0.634787336277873, 0.406914959152483, -0.732446926474468, -1.30212786928794, -0.276702172223688, -1.07425549216255, -1.98574500066411, -0.975081192944504, 0.716472702641831,
+#> 0.864854623307299, 0.686796318508738, 0.924207391573487, -1.15313949774307, -1.06411034534378, 0.987256091244849, 1.12999191166579, -0.3687342027541, 0.701784450402965, 0.773152360613436, -0.654205843595984, 0.630416540192494, -0.939677484437868, 0.34494489935061, -1.79609240696352, -1.43925285591116, 0.630416540192494, -2.22707330513399, -0.730306505904327, 0.809844838230541, 0.484460751441484, 0.874921655588352, 0.831537110683144, 0.46276847898888, 0.657998931062314, -1.09907513759859, -0.903844685525157,
+#> 0.679691203514918, 0.159076664652428, -1.41366637649157, -0.589875178679936, 0.838029564193564, 0.911255448443487, 1.25907839863062, 0.838029564193564, 0.0691577795693716, -0.93769812886707, -0.974311070992032, -1.52246554866292, 0.9359156635991, 0.165067317381348, 1.0609180981209, 0.748412011816403, -0.230773725271011, 1.10258557629483, 1.08175183720786, 0.540074620946741, -0.501612333401572, -0.772450941532134, -1.06412328874966, -1.54329928774989, -2.84257446998693, 0.500180390010092, 0.408598065078667,
+#> 0.408598065078667, 0.362806902612954, 0.500180390010092, 0.500180390010092, 0.042268765352966, 0.545971552475805, 0.545971552475805, -0.0493135595784593, 0.45438922754438, -1.37725727108413, -0.117250660513915, 0.58275328285274, 0.526752967383408, 0.246751390036746, 0.750754229260737, 0.610753440587406, 0.862754860199402, -0.81725460388057, -2.02126138647122, 0.862754860199402, -0.453252553329909, 0.80675454473007, 0.722754071526071, 0.666753756056739, -1.82526028232855, -1.40525791630856, -0.828565639484964,
+#> 0.995996001867936, 0.266171345326776, -0.390670845560268, 0.631083673597356, 1.2879258644844, 1.43389079579263, 0.995996001867936, 0.92301353621382, 0.850031070559704, -0.682600708176732, -1.70435522733436, -0.0987409829438039, -1.41242536471789, -0.682600708176732, -0.390670845560268, -1.19347796775554, -0.601093077505248, 0.262322415370121, -0.361255440595423, 0.118419833224226, 1.77329952790202, 0.262322415370121, -0.0734502763036338, 1.91720211004791, -0.744995659651143, 0.622078870734858, 0.262322415370121,
+#> -0.193369094758546, -1.68036244359946, 0.8379327439537, -1.39255727930767, -1.00881706025195, -0.514692323487314, -1.23917771361348, 0.209793066638851, 1.13008531896128, 0.816794339447259, 0.718890908349128, 1.0713432603024, 1.05176257408277, 1.13008531896128, -0.827983303001331, -1.21959702739385, -1.65037212422563, -0.475530951048062, -0.201401343973297, -2.9680267258209, 0.21664428655627, 0.24914092953971, 0.736590574291317, 0.21664428655627, 0.671597288324436, 0.541610716390674, 0.509114073407234,
+#> 0.21664428655627, 0.379127501473472, 0.314134215506591, 0.346630858490032, 0.0866577146225077, 0.151651000589389, 0.151651000589389, 0.21664428655627, 0.379127501473472, -2.41558379510241, -2.52455718385786, -0.494500891683498, 0.481487710323406, 0.559566798483958, 0.559566798483958, 0.54004702644382, 0.598606342564235, 0.481487710323406, 0.461967938283268, 0.0715724974805061, 0.501007482363544, 0.54004702644382, 0.481487710323406, -2.15368151509524, -0.104105450880737, -1.48698836282785, -0.909373361330973,
+#> -0.947881028097431, 0.804217809776414, 1.26630981097391, 1.22780214420745, -0.601312027199308, 0.149587474746626, 0.938994643459018, 0.784963976393185, 0.68869480947704, -1.19818086207941, -0.716835027498682, -1.82437705646178, -0.560216052252813, 0.321756741381353, 1.08613316253096, -1.58918431149267, -0.38382149352598, 0.439353113865909, 0.556949486350464, -0.619014238495091, -1.88317524270406, 0.0865639964122422, 1.02733497628869, 0.997935883167547, 1.35072500062121, 0.733344045077297, 0.439353113865909,
+#> -0.501417866010535, 0.321756741381353, 0.828448211729574, 0.803951087189183, 0.0200431018966831, 0.558979841785277, 0.950933834431527, 0.093534475517855, -0.0534482717244888, -2.47866360122316, -1.0578303778805, 0.411997094542933, -0.0779453962648794, -0.577350269189626, -0.577350269189626, 1.15470053837925, -1.47254297643065, -1.47254297643065, 0.503274181818072, 0.87606987205368, -0.540553750841632, 1.06246771717148, 1.13702685521861, 1.24886556228929, -0.913349441077241, -0.0931989225589022, 0.316876336700267,
+#> -0.652392457912315, 0.0466643551100318, 0.536640083765365, 0.373314840880254, 0.373314840880254, 0.454977462322809, 0.454977462322809, -2.23988904528152, -0.916579600113357, 1.06879137486142, 1.14820621386041, -1.63131315110428, -0.201846049122436, 0.274642984871511, 0.936433309863105, 0.539359114868149, 0.989376535862432, 0.221699758872184, -0.837164761114366, 0.645245566866804, 0.565830727867812, 0.0893416938738651, -0.704806696116047, -2.18721702409722, -1.38375922928015, -0.673220509606634, 0.726958732102951,
+#> 1.06132989430225, 1.06132989430225, 1.18671908012699, 0.601569546278212, -0.526933126144438, -0.777711497793916, 0.580671348640755, 0.43438396517856, -1.697232193842, 0.601569546278212, -1.19567545054305, -1.31045998953728, -1.31045998953728, 0.0313079178387748, -0.86320402041193, -1.66826476483756, 0.836368662264409, 1.10472224373962, 1.01527104991455, 0.92581985608948, -1.04210640806207, -0.147594469811366, 0.746917468439339, 0.836368662264409, 0.836368662264409, 1.10472224373962, 0.92581985608948,
+#> 0.657466274614268, -0.684301632761789, -0.684301632761789, -1.31045998953728, -2.22669121464367, 0.242963739723635, 0.700307249791655, 0.563104196771249, 0.700307249791655, 0.471635494757645, 1.02044770683927, 0.746041600798457, -0.0314423663171764, -1.03759808846682, -0.534520227391998, 1.11191640885287, -1.40347289652124, -1.31200419450763, 0.700307249791655, 0.288698090730437, -2.74224581539605, 0.111172127651191, 0.314987695011708, 0.416895478691966, 0.620711046052483, 0.416895478691966, 0.518803262372225,
+#> 0.416895478691966, 0.518803262372225, 0.314987695011708, -0.907905709151394, -2.32126170426883, 1.01110172394532, 0.925656507837262, 0.904295203810248, 0.861572595756221, 0.669320859513097, -0.39874434183759, -0.996860854593974, -0.377383037810576, -0.526912165999672, 0.370262603134905, -0.121047389486411, -1.60463583482471, -2.35574197027458, 0.49846134443491, 0.423350730889923, 0.573571957979897, 0.49846134443491, 0.423350730889923, 0.573571957979897, 0.49846134443491, 0.27312950379995, 0.198018890254964,
+#> -1.48058239558425, -1.29958210272554, -0.647981048434185, 1.12582182158118, 0.999121616580084, 0.781921265149631, 1.10772179229531, -0.756581224149411, 0.148420240144143, 0.0217200351430453, -2.53080426490179, 0.283371906108695, 0.547200922140929, -0.361543466414542, 0.723086932829084, 0.488572251911543, 0.459257916796851, -1.15303051451124, 0.752401267943777, -0.244286125955771, -0.0390857801529233, 1.0748589542054, -1.63809988573193, -0.448269449910366, 0.788221003002242, 1.09151111409401, 0.438270874819429,
+#> 1.06818110554849, 0.998191079911931, 0.0416607295455732, -0.238299373000678, -0.704899543911096, 0.414940866273908, 0.97486107136641, -1.84806996264162, -0.938199629366305, -2.63784804159638, 0.180427362626291, 0.537673540626349, 0.775837659293053, 0.497979520848564, 0.696449619737485, 0.101039323070723, -0.176818815373766, -0.931005191151664, 0.577367560404133, 0.378897461515212, -0.210395451437347, -0.0888336350513243, 0.822879987843847, 0.914051350133364, 0.336632722299756, -1.06132816613951,
+#> -1.97304178903468, 0.914051350133364, -0.11922408914783, 0.883660896036858, 0.397413630492767, 0.853270441940353, -1.66913724806962, -2.82160523510709, 0, 0, -0.10852327827335, 0.217046556546699, 0.542616391366748, 0.542616391366748, 0.651139669640097, 0.325569834820049, 1.0852327827335, -0.759662947913447, 0.325569834820049, -0.885672140056234, -1.21854220611764, 1.02833073979684, 0.861895706766134, 1.007526360668, 0.98672198153916, -1.57221665130788, 0.445808124189379, 0.300177470287516, 1.007526360668,
+#> -0.386367040964129, 0.653851915477757, -1.34336848089066, -0.885672140056234, -1.47219744873091, 0.766854938475432, 0.619225110747541, 0.766854938475432, 0.766854938475432, 0.373175397867724, 0.693040024611487, -0.660233396227512, 0.668435053323505, -0.414183683347694, 0.127125684987906, -2.23495155865835, -1.71554948302116, -0.0706780685888868, 0.792879423988058, 0.834001209348865, 0.731196745946847, 0.875122994709671, 0.299417999658375, 0.710635853266444, 0.731196745946847, 0.854562102029268, 0.381661570379989,
+#> -0.666943956320587, -1.65386680497995, 0.56670960450362, -1.75667126838197, -0.913674668485428, -2.03706777848143, 0.254633472310179, 0.254633472310179, 0.691147996270485, 0.636583680775447, 0.582019365280409, 0.472890734290332, 0.8548409427556, 0.363762103300255, 0.636583680775447, -0.945781468580664, -1.76424620100624, -1.24715617093832, -0.320260085964004, -0.932361274154591, 0.659101815140936, 0.851476474286549, -0.250305664456508, -1.31711059244582, 0.956408106547793, 0.799010658155928, 0.729056236648432,
+#> 0.886453685040297, 1.04385113343216, 1.16627137107028, -0.145374032195265, -1.56195106772205, -1.31711059244582, -1.89919727008562, 0.108431678049871, 0.834595340141432, 0.471513509095651, 1.00545737828062, 0.791879830606634, -1.08760258892446, 1.06953064258282, -0.0197148505545219, 0.450155754328253, -1.21574911752886, 0.663733302002241, -1.17303360799406, 0.625858246057414, 0.625858246057414, 0.358825394406251, 0.225308968580669, 0.358825394406251, -0.0417238830704943, 0.759374671882996, -1.37688814132631,
+#> -1.51040456715189, 0.759374671882996, 0.759374671882996, 0.625858246057414, -0.0417238830704943, 0.492341820231833, -2.71205239958213, 0.0917925427550874, -0.444454226377486, 1.10809135891373, 0.590576163816659, 0.901085280874902, 1.10809135891373, 1.6256065540108, 0.797582241855488, -1.89349677264929, -0.858466382455143, -0.444454226377486, -0.237448148338657, 1.10809135891373, -1.16897549951339, -0.858466382455143, -0.133945109319242, -0.961969421474558, -0.237448148338657, -0.537641405241753,
+#> -1.15323082090889, 1.11125881529522, 1.06728814274757, 1.06728814274757, 0.869420116283132, 0.121918682973037, 0.517654735901911, -1.19720149345654, -0.361758715051142, -1.50499620129011, -0.911164309920496, 1.23824893399452, 1.31301113378287, 1.31301113378287, 1.21955838404743, 0.266340336745991, -1.09806980939137, -0.387828911402057, -0.742949360396712, -0.593424960820015, -0.985926509708845, -0.63080606071419, -0.46459772777289, 1.23515005676208, 1.46178309470007, 0.781883980886086, -1.82439595540086,
+#> -0.237964689834895, 0.215301386041097, -0.124648170865897, -1.03118032261788, -0.0113316518968991, -0.474978891952915, 1.1520764613326, 1.1520764613326, 1.0282787714087, -0.262754280654804, -0.386551970578702, 0.480031858888585, -1.44767502706926, 0.99290800285902, 0.904481081484807, -0.669518118976184, -1.32387733714536, -1.53610194844347, 0.391604937514372, -1.96943045501771, 0.082923387579693, -0.992119101399897, 0.539002019268004, 1.0928117863181, -0.470886379470399, 1.22311996680047, 0.929926560715128,
+#> 0.669310199750379, -0.601194559952774, -0.503463424590993, -3.31083516024922, 0.48427141149914, 0.37885178450613, 0.431561598002635, 0.37885178450613, 0.48427141149914, 0.48427141149914, 0.58969103849215, -0.0691816302141629, 0.405206691254383, -1.36057206087854, 0.0625929035270997, 0.431561598002635, 0.536981224995645, -0.0428267234659103, 0.115302717023605, -2.05187548350108, 0.384843983639268, 0.405494148615034, 0.4261443135908, 0.488094808518097, 0.467444643542331, 0.488094808518097, 0.488094808518097,
+#> 0.488094808518097, -1.98992498857378, 0.405494148615034, -1.75275751368889, -0.763827949688377, -0.032880011079301, 0.139107739181658, 1.38601892857361, 1.57950514761719, 1.32152352222575, 0.870055677790734, 0.483083239703576, 0.440086302138336, 0.784061802660254, -0.548843261862178, -0.2478646989055, -0.935815699949336, -0.2478646989055, -1.27979120047125, -1.19379732534077, 0.684041358829009, -1.32921673136092, 0.194329931485514, -0.893917684833364, -1.0571548272812, 0.466391835565233, -1.32921673136092,
+#> -0.676268161569588, 1.06492802454062, 0.629628978013065, -0.730680542385532, -1.38362911217686, 0.956103262908728, -1.11156720809714, -0.458618638305813, 1.1737527861725, 1.39140230943628, 1.663464213516, 0.956103262908728, -0.0233195917782618, -0.186556734226093, -2.09785137513525, 0.297456538265446, 0.767124756579308, 1.1428593312304, 0.954992043904853, -0.0313112145542574, -0.876714007519209, 0.579257469253763, 0.579257469253763, 0.438357003759605, -0.360078967373961, -1.39334904766446, 0.093055231072062,
+#> -1.17587973809242, 0.448357022438116, -0.41451875659373, 0.651386617504433, 1.10820320640365, -0.00845956646109641, 0.397599623671537, 1.15896060517023, 0.955931010103908, -1.63269632699163, -1.58193892822505, -2.13934272536068, 0.334415458139892, 0.74670848872332, 0.677992983626082, -1.13151531726785, 0.792518825454812, 0.380225794871384, 0.815423993820558, 0.242794784676908, -0.719222286684425, -0.717042780476551, 0.496960342904539, 0.720592497211582, 0.688645046596291, 0.465012892289248, 0.592802694750415,
+#> -2.37831021247173, -0.0141988669401301, 0.145538386136329, 0.589416815949991, 0.655963875815312, -1.47354203987498, 0.98869917514192, 0.0570403370274185, 0.522869756084669, -1.34044792014433, -0.870608683268797, -0.295339228837497, -0.36724791064141, -1.05038038777858, -0.798700001464884, -1.05038038777858, 1.53833215716227, 1.35856045265249, -0.295339228837497, -0.690836978759016, 0.0642041801820646, 1.50237781626031, 1.39451479355444, -0.439156592445322, -1.39009305247278, -0.720413187777866, 0.842173163176942,
+#> 1.06539978474191, 1.1770130955244, 0.953786473959428, -0.497186566212893, -1.2784797416903, -1.05525312012532, 0.507333230829483, 0.395719920046997, -0.765544307050929, 0.200798506767456, 1.02909234718321, 0.476896453572709, 0.752994400377962, 0.614945426975336, 0.338847480170083, 0.614945426975336, 0.200798506767456, -1.17969122725881, -2.28408301447982, -1.83704404180458, -1.20873907636653, 0.945449376563921, 0.855691524358485, 0.945449376563921, -0.221402702106741, 0.76593367215305, -0.0418869976958697,
+#> -0.939465519750225, -0.849707667544789, -0.670191963133918, 1.12496508097479, 0.945449376563921, 1.03520722876936, -0.849707667544789, -1.7565911535527, 0.834135463977538, 0.906100092242267, 0.546276950918623, 0.834135463977538, 0.402347694389165, 0.618241579183352, 0.43833000852153, -0.173369331728665, -1.07292718503777, -1.57667958289088, -1.01011639073136, 0.613284951515466, 0.450944817290784, 0.450944817290784, 0.450944817290784, 0.450944817290784, 0.288604683066102, 0.613284951515466, -2.30883746452881,
+#> -1.99856603697584, -1.51141556546298, 0.527399370868624, 0.617612421148783, 0.635655031204815, 0.599569811092752, 0.599569811092752, 0.58152720103672, -0.0680067609804279, -1.6377138358552, 0.545441980924656, 0.58152720103672, 0.527399370868624, -1.74628638378315, -0.0480408908881198, -1.83035794283736, -1.83035794283736, 0.574088646113031, 0.725417452410608, 0.439574151626295, 0.641345893356398, 0.674974516978082, 0.590902957923873, 0.540460022491347, 0.607717269734715, 0.103287915409457, 0.557274334302189,
+#> -2.83896783569188, -0.319883699796268, 0.279898237321734, -0.439840087219868, 0.079970924949067, 0.719738324541603, 0.559796474643469, 0.679752862067069, 0.639767399592536, 0.559796474643469, -0.479825549694402, 0.559796474643469, -1.1269766715896, 0.462610677126291, 1.22072156651387, 1.58754941621753, -0.0754035024390869, -1.02915591166862, -0.0509483124588425, -0.14876907237982, -0.784604011866176, -1.29816300145131, 1.44081827633607, -0.197679452340309, -1.0532228458603, -1.33143265420076, 1.11681365919527,
+#> 0.708772606962595, 0.986982415303052, 1.17245562086336, 1.00552973585908, 0.727319927518625, -0.737918396407786, 0.152352990281679, 0.54184672195832, -1.16450676919649, -1.1088648075284, -1.01612820474824, -0.929620405100932, -2.26117217898556, -0.904962038917883, 1.19099908664125, 0.796465227712469, -1.15154570074837, -0.337819616707766, 0.870440326261615, 0.327956270234546, 1.1663407204582, 0.549881565881984, 0.96907379099381, -0.683036743270446, 0.352614636417595, 0.96907379099381, 0.96907379099381,
+#> -0.43645308143996, 0.574539932065032, -0.707695109453495, -1.32415426402971, -1.18541430431542, -1.51140323800215, 0.77051929780502, 0.66185631990944, 0.66185631990944, 0.55319334201386, 0.77051929780502, 0.77051929780502, -0.533436436941937, -1.62006621589773, 0.66185631990944, -0.590106414509192, 0.565346704809506, 0.367269027212015, -0.226964005580458, -2.17472783528912, 0.664385543608251, 0.730411436140748, 0.664385543608251, -1.19945946008411, -0.990157809331176, -0.843646653804124, 1.73076365045693,
+#> 0.914487212520501, 0.97727770774638, 1.39588100925224, -0.132021041244157, -0.236671866620623, -0.0901607110935705, -0.927367314105297, -1.01108797440647, 0.412163250713465, -1.54040666586668, -0.0224876885527982, 0.0196767274836986, 1.05270492037787, 0.947293880286627, 0.884047256231882, -0.929022633337478, -1.03443367342872, 0.820800632177137, 0.884047256231882, -0.0435698965710466, -1.51932445784843, 0.947293880286627, 0.799718424158888, -1.26633796162945, -0.661731464319866, 1.14964406474004,
+#> -0.689176548093501, 0.518407137946438, 0.189066132662819, 0.930083394550963, 1.01241864587187, -0.689176548093501, -1.75953481526527, -1.21165293722658, -0.396335072924582, 1.26827223335866, 0.215153325301916, 1.30224381103791, 0.860613301207664, -0.226477184528333, -0.362363495245333, -1.44945398098133, -0.965840294910756, -0.643893529940504, -1.26766538707037, -1.12681367739588, -1.04632698615332, 0.985961967721396, 1.6298554976619, 1.36827375112357, -0.241460073727689, 0.120730036863844, -0.664015202751144,
+#> 0.603650184319222, 1.0865703317746, -0.664015202751144, 0.82498858523627, -1.4136807194295, 0.75255640288038, 0.777172733815719, 0.875638057557077, 0.75255640288038, 0.555625755397663, -0.28132949640388, 0.875638057557077, 0.826405395686398, 0.23561345323825, -2.20140330936036, -0.109015179856504, -0.379794820145238, -1.26598273381746, -0.278491522004925, 0.915043572301895, 1.03439708173258, -1.47202661631175, 0.986655677960305, 0.509241640237576, -1.99718205780675, -0.302362223891061, 0.938914274188032,
+#> -0.70816415595538, 0.389888130806894, -0.0159138012574244, 0.707106781186547, -0.707106781186547, -0.38198439954584, 0.4020888416272, -2.2114886289496, 2.05735457299251, 0.314969592607974, 0.4020888416272, 0.4020888416272, 0.0536118455502935, -1.34029613875733, -0.38198439954584, 0.0536118455502935, 0.314969592607974, 0.314969592607974, -1.91192878436341, -1.72529799196351, 0.161746686746579, -0.107831124497719, 0.514271516835276, 0.555745026257476, 0.783849328079574, 0.742375818657375, 0.721639063946275,
+#> 0.265430460302078, -2.40229946375714, -0.205911382607755, 0.892282657966937, 1.44137967825428, 1.44137967825428, 0.343185637679591, -0.205911382607755, -1.30410542318245, 0.892282657966937, 0.343185637679591, 0.343185637679591, -0.755008402895101, -0.755008402895101, 0.343185637679591, -0.205911382607755, -0.205911382607755, -2.13183034063704, 0.862268749148625, 0.97154243855686, -0.252322882815381, 0.862268749148625, 0.534447680923917, -0.361596572223617, 0.600011894568859, 0.643721370332153, -1.2357860874895,
+#> -0.4927249995135, -1.93520210748991, 0.0222437023849415, 0.756285881088011, 1.1789162264019, 0.823016988242836, -1.13442882163202, 0.0222437023849415, 1.13442882163202, 0.578336262008479, 0.044487404769883, -1.29013473832661, -0.200193321464474, -1.820803164823, -0.704043890398228, 0.679766514867255, 0.776876016991148, 0.849708143584069, 0.825430768053095, -0.509824886150441, -1.31097827867256, 0.558379637212388, 0.655489139336282, -1.69017163682962, 1.81089818231745, 0.36217963646349, -0.36217963646349,
+#> 0.543269454695235, 0.36217963646349, 0.12072654548783, 0.24145309097566, 0.060363272743915, -1.44871854585396, 0.557115764630265, 0.109290652391583, 0.855665839456053, 0.962290866179549, 0.855665839456053, -0.573109518638789, -1.12755965760097, -1.63935978587375, -1.44857043063967, -0.460091848937662, -1.25087471429927, 1.08193473851747, 0.805160735640908, 0.567925876032427, 0.528386732764346, 0.409769302960105, 0.765621592372828, 0.607465019300507, -1.60672700371199, 1.53181954792529, 0.52656296959932,
+#> 0.287216165235992, -0.813779134835312, -0.287216165235992, -1.2446033826893, 0.826835445157726, -0.104253164824235, -0.758531647514261, -1.41281013020429, -0.632708862381564, 0.751341774078107, 1.33012658568852, -2.18742603102752, -0.502965638370752, -0.526690432633523, 0.96797160592107, 0.944246811658298, 0.351126955089015, -0.408066461319667, 0.778173251818899, -0.336892078531353, 0.920522017395527, -1.52643960092344, 1.09864761085572, -0.0680578166016808, 1.77922577687254, -0.262508721177915,
+#> -0.651410530330383, 0.709745801703256, 0.0291676356864362, -1.13753779177097, 0.0291676356864362, -1.71414756541948, -0.143474906356696, 0.00377565543043954, -0.437976029930968, -0.437976029930968, -0.437976029930968, -1.02697827707951, 0.249193258408999, 1.37811423211037, 1.62353183508893, 1.03452958794039, 0.887279026153255, -0.9778947564838, 0.831397155715458, 0.810295705062781, 0.810295705062781, -1.53196531738432, 0.409368142661926, -0.645704389971903, 0.388266692009249, 0.451571043967279, 0.367165241356573,
+#> -1.89068997847982, -1.99364741645599, 0.572643406854381, -1.06045075343404, 0.689292989732125, 0.922592155487613, 0.339344241098892, -1.29374991918953, -0.127254090412084, 0.339344241098892, 0.689292989732125, 0.922592155487613, -0.646504425624501, 0.574670600555111, 0.981728942614982, 0.710356714575068, 0.710356714575068, -0.23944608356463, 0.0319261444752839, 0.846042828595025, 0.710356714575068, -0.782190539644457, -2.95316836396377, 0.846042828595025, 0.574670600555111, 0.0319261444752839, -1.05356276768437,
+#> 0.303298372515198, -0.646504425624501, -2.93098575605727, 0.101568813328717, -0.0580393219021241, 0.101568813328717, 0.580393219021242, 0.580393219021242, 0.4207850837904, 0.4207850837904, 0.101568813328717, 0.580393219021242, 0.101568813328717, -1.44861551465005, -0.754205947041505, 0.345275868338694, 1.00110712663566, 1.36760106509572, 1.34831191043993, 0.190962631092351, -0.812073411008884, -0.792784256353091, -0.445579472548818, -0.959182120492198, -0.828011915980445, 1.00837094718411, 0.418105026881215,
+#> 0.680445435904722, -0.139368342293738, -1.45107038741127, 1.27071135620761, -0.667538593004856, -0.384149567672606, -1.80109469433386, -2.08448371966611, 0.371554499880061, 0.654943525212311, 0.654943525212311, 0.560480516768228, 1.12725856743273, 0.749406533656395, 0.560480516768228, 0.749406533656395, 0.371554499880061, 0.371554499880061, -1.23431664366936, -1.6229475142341, 1.22817649725824, 0.0438634463306513, 1.14044960459693, 0.50442963280249, 0.964995819274328, -1.14044960459693, 0.592156525463792,
+#> -0.175453785322605, -0.263180677983908, -1.27203994358889, -1.1876711763588, -1.23737319594487, -1.07169979732463, -1.25394053580689, -1.27050787566891, 0.485630149705558, 0.899813646256141, 0.319956751085325, -1.10483447704868, 0.419360790257465, 1.21459310363458, 1.0157850252903, 0.0714466531549755, 0.502197489567582, 1.11518906446244, 1.0820543847384, -2.01549280419639, 0.561362089759398, 0.1555581694514, 0.541071893743998, 0.764264049913398, -0.250245750856599, 0.784554245928797, -1.2444653556112,
+#> 0.703393461867198, -1.18462971680382, -1.0400157127179, -1.25693671884678, 0.35189407660907, -1.14847621578234, -0.100024686159427, 1.32803860418903, 1.43649910725347, 0.876119841420528, -0.696557453013845, 0.894196591931268, 1.05688734652793, 0.40612432814129, 0.207280072523151, -1.1303994652716, -1.99103065765079, -0.951756413272629, -0.639974139959181, -0.120337017770102, 0.191445255543345, 0.399300104418977, 1.64642919767277, 1.95821147098621, 1.2307194999215, 1.2307194999215, 0.191445255543345,
+#> -0.120337017770102, -0.0164095933322864, -1.05568383771044, -0.224264442207918, -0.328191866645734, -1.26353868658608, -0.120337017770102, -0.0164095933322864, -1.12104565268833, -0.0819028787352208, -1.30020819992163, -1.26437569047497, 0.383919744071347, 1.02890491411121, -1.01354812434836, 1.24389997079117, 0.778077347984598, -0.0102378598419026, 0.957239895217893, 0.921407385771234, 0.778077347984598, -1.30020819992163, -0.446617032274235, 1.63067148993151, 1.38139686726682, -0.945166277603614,
+#> -1.02825781849184, -0.0311593278330862, -0.0311593278330862, -0.529708573162465, -1.71415923140553, 0.00730465581564859, -1.06647974908469, 0.689072531942847, 0.689072531942847, 0.672028335039667, 0.723160925749207, -2.21774399553963, -0.674965563859886, 0.353553390593274, 0.610683129206564, 0.610683129206564, 0.610683129206564, 0.610683129206564, 0.0964236519799838, 0.570061164540384, 0.660157038246479, 0.425907766610632, 0.64213786350526, 0.660157038246479, 0.696195387728917, 0.570061164540384,
+#> 0.245716019198441, -1.33997135802883, -2.13281504664247, -0.997607037945672, -0.811674970137229, -2.41278723999697, 0.289089715391342, 0.48922874912381, 0.48922874912381, 0.48922874912381, 0.48922874912381, 0.48922874912381, 0.48922874912381, -1.76843638685915, -1.14337075060806, -0.101594690189571, -1.33278457977505, 0.50452956314482, 0.125701904810825, 0.428764031478021, 1.09171243356251, 0.144643287727525, 1.09171243356251, 0.959122753145613, -1.86838827977552, -0.716939688751071, -0.130352670682013,
+#> 0.890743249660421, 0.760390578978408, 0.673488798523733, 0.391058012046039, -1.4007173259361, 0.681765070145887, 0.830513812723172, -1.6796212182685, 0.923481776833975, -0.638380020227513, 0.477235549102121, 0.75613944143453, 0.0495829141924283, -2.04184172918932, 0, 0.226871303243258, 0.453742606486515, 0.680613909729773, 0.90748521297303, -0.90748521297303, 0.680613909729773, -0.271374403643329, 0.479638480857977, 0.678436009108323, 0.788879080358515, 0.877233537358669, -1.81757740114602, -0.735235302894136,
+#> 0.604166346327164, 0.189648628891935, -1.88293995828421, -1.27335507970299, 0.604166346327164, 0.848000297759652, 0.726083322043408, 0.726083322043408, -0.541853225405529, -0.29267091173913, 0.510739434211423, 0.281193621082694, 0.510739434211423, 0.453352980929241, 0.453352980929241, -2.76028840287297, 0.453352980929241, 0.166420714518329, 0.223807167800512, -2.2296152185578, -1.08947107270438, -0.60807687778849, 0.380048048617806, 0.405384585192327, 0.532067268064929, 0.481394194915888, 0.405384585192327,
+#> 0.861442243533694, 0.861442243533694, 0.269712392146612, 0.612716195202629, 0.823795458621717, 0.612716195202629, 1.21956907753251, -0.152446134691563, -1.68277079447995, -1.44530662313347, -0.257985766401107, -2.31362831819672, -0.951000597050184, 0.539373472953835, 0.496791356668006, 0.539373472953835, 0.624537705525493, 0.667119821811322, 0.198716542667202, 0.198716542667202, -1.40453903828506, 0.194156867057053, 1.08645225608521, 1.12363123062805, 0.640304561571131, -1.18146519102802, 0.156977892514213,
+#> -1.18146519102802, 0.565946612485451, -1.42886901662352, 0.510310363079829, 0.71443450831176, 0.816496580927726, -1.12268279877562, 0.510310363079829, -1.9272981013284, 1.00152172077764, 0.19357142502425, 0.446055892447184, 0.19357142502425, 0.092577638055076, -1.80893103242738, 0.169587284290067, 1.14565632053734, 0.486150214964858, 0.116826795844268, 0.697192168748052, -0.806481751957205, -2.16295440962874, -1.45389099425081, 0.635980124757839, 0.617320561195262, 0.30010798063145, 0.654639688320416,
+#> 0.206810162818564, 0.580001434070107, 0.654639688320416, -1.19265710437473, 0.56134187050753, 0.598660997632685, -1.70824580610188, 0.0885371301943051, 0.53122278116583, -0.35414852077722, 1.05202942936762, 0.843706770086906, 0.661424443216278, -0.35414852077722, -1.60408447646153, 0.843706770086906, -2.42342732986043, -0.644625588369398, 0.176359830780307, 0.0395289275886899, 0.751049624185101, 0.50475399844019, 0.477387817801866, 0.614218720993484, 0.50475399844019, -0.550012686504905, -0.328743214922472,
+#> -0.682774369454365, 0.644842460040233, -0.417251003555445, -0.682774369454365, 2.01671318385132, -1.22727535275633, 1.33737393321468, 1.14308232064112, 0.288199225317448, 1.16251148189847, -1.03298374018276, -0.178100644859097, 1.12365315938376, -0.255817289888522, -1.36327948155782, -0.197529806116454, -0.799833805094492, -2.65893229941593, 0.124478027831444, 0.573415177387471, 0.102031170353643, 0.663202607298677, 0.506074604954067, 0.685649464776478, -0.257118549291179, -0.818289986236214, 0.326499745131656,
+#> 0.752990037209883, -2.18417505184816, 0.749889185716983, 0.723692183595866, -0.19320289064324, -0.428975909733296, 0.435525160263575, 0.854677194201452, 0.0425701284468156, -1.73005999782628, 0.925101526615441, -0.090107291553452, -1.33959506776132, -1.96433895586526, 0.45654361053749, 0.690822568576466, 0.0660786804725316, 0.534636596550482, 0.612729582563474, 0.612729582563474, 0.690822568576466, 0.534636596550482, -1.4359795832156, -1.1009176804653, -0.526525847179054, 0.622257819393428, -0.0957319722143735,
+#> -0.574391833286241, 1.1009176804653, 1.05305169435811, -0.526525847179054, 1.24451563878686, 0.861587749929361, 0.909453736036548, -1.72317549985872, 0.191463944428747, -1.69551908587751, 0.121108506134108, 1.02942230213992, 1.23126981236343, 0.928498547028162, 0.524803526581135, -1.08997655520697, 0.121108506134108, -0.0807390040894055, -1.08997655520697, -1.32381451948924, -1.2853634753547, -0.170283195452973, 1.15627782718874, 0.348805900363348, 0.252678290026992, 1.02169917271784, -0.0231124472062908,
+#> -2.53723309331283, 0.73959831060131, 0.598355577673977, -0.277349366475491, -0.672829018672025, 0.118130285721043, 0.937338136699577, 0.965586683285044, 0.457112844746643, -0.305597913060958, -0.0969185645733849, 0.550199235808909, 0.717197377843049, 0.779821681105852, 0.445825397037571, -1.20328125554956, -2.26789441101721, -0.577038222921538, 0.758946913351584, -1.49552800410931, 0.821571216614387, 0.779821681105852, 0.529324468054641, 0.257952487249163, -0.659200937355929, 1.08835814583985, 1.28940476603051,
+#> 1.05742789657975, -0.00966570289378196, -0.782921934396339, -1.09222442699736, -0.891177806806696, -1.98048122666005, -0.402938598898207, 0.832486350553842, 0.927519038973231, 0.0152052301471021, 0.927519038973231, 0.547388285295677, -1.03015434246617, -0.669030126472494, 0.832486350553842, -2.20819891437588, 0.322192724161605, 0.542226779686603, 0.487218265805354, 0.487218265805354, -0.117875386888392, 0.487218265805354, 0.140242260593797, -0.552719497634375, 0.932198555711709, -1.74065394031124,
+#> 0.486723139707884, 0.734209481932231, -1.56034873438054, -1.10749332677157, 0.811751019761641, 0.402024698591629, 0.380460155372154, 0.100121093518988, 0.984267365517436, 0.962702822297961, 1.09209008161481, 0.294201982494257, -0.0939597954562811, -0.827154264918408, 0.596105587566898, -2.03476868520897, -1.76617755591554, 0.168021316160106, 0.519693838355677, 0.519693838355677, 0.558768563044074, 0.493512236736306, -0.407684021651731, -1.1801379574129, 1.09430974232833, -2.04303166566704, -2.00095296469395,
+#> -1.4960085530169, 0.208178836393173, 0.544808444177878, 0.692083897583686, 0.565847794664422, 0.50272974320479, 0.755201949043319, 0.671044547097142, 0.628965846124054, 0.713123248070231, 0.50272974320479, 0.523769093691334, 0.650005196610598, 0.628965846124054, -0.675473884041678, -1.55912660447653, 0.187139485906629, -1.6059438861505, -1.5290891438422, 0.891835238869222, 0.930262610023371, 0.12328781578623, 0.718912068675549, 0.353852042711128, 0.776553125406773, 0.949476295600446, 0.296210985979903,
+#> -1.3753796592256, -0.529977493834313, -0.707106781186548, 0.707106781186548, -1.38590742453381, -1.68556308389247, 0.326410628944255, 0.711682190976819, 0.626066288302916, 0.840106044987673, -0.144476835762211, 0.711682190976819, -0.888056041656735, -1.50969527081645, 0.532833624994041, 0.710444833325388, 1.06566724998808, 0.0888056041656735, -2.22651550155043, 0.431030565043737, 0.431030565043737, -0.048526619905586, 0.510956762535291, 0.431030565043737, 0.470993663789514, -1.51359933929831, 0.0439634662866728,
+#> 0.0439634662866728, -1.01115972459347, -0.257500302536226, 1.55128231040117, 1.09908665716682, 0.0439634662866728, -2.43110072548694, 0.113602837639577, 0.113602837639577, 0.477131918086222, 0.295367377862899, 0.295367377862899, 0.477131918086222, 0.658896458309545, -1.17516278835534, 0.427331923038304, 0.894726213861449, -0.97485094943113, 0.827955600886714, -1.12398200257779, 0.787242455246792, -0.559715734077199, 0.896455281408196, -1.42886901662352, -0.673609679265374, 0.591960021172601, 0.836908995450919,
+#> 0.673609679265374, -1.60976734875699, 0.439411559765688, 0.756294896135174, -0.32110844752108, 0.735169340377209, -0.0289763793899868, -0.985196899259565, 1.01417327864955, -1.22777606224949, 1.07733709810034, 0.689107513199319, -0.281466449053243, -0.354259496222185, 0.689107513199319, 0.93175100376246, 0.956015352818774, -1.64026999620683, -0.839546477348466, -1.49279801192197, 0.635547668442029, 0.418771719516066, 0.43847862396388, -0.815368043303461, -0.300398752796012, 1.11576679609947, 0.608540421252086,
+#> 0.545587963881181, -1.15412838513327, 1.14347950034851, -0.710811581297725, -0.432667919050789, -0.338090970696901, 0.277939816401133, -0.991456957012999, -1.25280335153944, -1.30880615036653, 0.763297406235949, 1.15531699802561, 0.539286210927572, 1.15531699802561, -1.71511687076618, -0.0618060133609434, 0.602608630269198, 0.618060133609434, 0.556254120248491, -0.86993928985988, -1.50722039754793, 0.768783558480824, 0.859823716721974, -0.0505778656895281, 0.799130277894541, -1.92602645282401, -1.25273330723935,
+#> -1.37515024280019, 0.257075564677781, 0.481506613206003, 0.971174355449395, 0.848757419888547, -0.640648629435105, 1.03238282322982, 1.11399411360372, 0.746743306921174, -0.0285639516308647, 0.563117903579901, -1.08951072649155, 0.29788120986473, -0.735562605639081, -1.41595801585523, -0.404559433101495, 0.588450084511265, 0.919453257048851, 1.04817671303569, -1.42358077622099, -0.652981495645526, 0.827380280196815, 0.421801711472886, 0.827380280196815, -1.13888851785555, 0.920471541828454, 0.920471541828454,
+#> 0.834664872674954, -0.195015157167045, -0.538241833781046, -1.39630852531605, -1.39630852531605, -0.0234018188600455, 0.834664872674954, 1.17789154928895, -1.38672099686764, 0.420332210146618, 1.11275446703993, 1.07897777158172, -1.16717247638927, 0.0150118646480935, 1.16341951022725, -0.525415262683273, -0.71118708770343, -1.35255298821204, -0.705054217259469, 0.302166093111201, 1.02160917194739, 0.733831940412917, -1.78678348883436, 0.367494476426926, 0.473096337469146, 0.451975965260702, 0.49421670967759,
+#> -1.47402400968094, 0.622365692976397, 0.229292623728146, 0.622365692976397, -1.42386474484478, -0.50524232881589, 0.0793355722934041, 0.914446859592395, 0.93532464177487, -0.394496331986063, -0.742581330797295, 1.13707766278336, -1.12924109518953, 0.773452804924335, 0.355788290265194, -0.633081106402271, 1.12547752249293, 0.17585586288952, -0.0703423451558078, 0.949621659603406, -1.54753159342777, -2.01427999044859, -0.638674143312966, 0.650956338376677, 0.393030242038749, 0.307054876592772, 0.564980972930701,
+#> 0.736931703822654, -0.707106781186548, 0.707106781186548, -0.707106781186547, 0.707106781186547, -1.78125085084331, 0.311602629259796, 0.427872267043302, 0.567395832383509, 0.474380122156705, -1.25348028787531, -0.0596895375178717, 1.18715857952211, 0.126011245871062, -1.80470389748439, -0.89496772657573, -0.0265831997992792, 0.69707057251443, 0.738422216646642, 0.841801326977171, 0.448960707721158, -2.14139914541267, -0.19711623932669, 0.827290883234743, 0.200102849013458, 0.283727920242962, 0.367352991472467,
+#> 0.660040740775734, -0.324299494442592, 1.12190095374735, -0.797601459304754, -1.83706461344914, -1.36403576736679, 0.381277561281898, 0.593324975042953, 0.544390956482709, 0.593324975042953, 0.658570333123278, 0.430211579842141, -1.14939154226538, 0.478913142610576, 0.670478399654806, -0.160702427944268, 0.248358297732051, 0.45288866057021, -1.4901497863923, -1.08108906071599, 0.65741902340837, 1.37327529334193, -1.10906783962669, 0.276188100140497, 0.832879739486188, 0.940594025644474, 1.11075173882639,
+#> -1.27145624572042, 0.146524697462205, 0.174884316325857, -1.1012985325385, -1.11499743118271, -0.527738997677224, 0.567418621562729, 1.0753178072972, -0.770518002816772, -0.154897949019867, -1.12797480824723, 1.05648344716114, 0.996907312922731, -1.19487610589409, 0.64073066547944, -0.432926125323946, 0.987071565738596, -1.47613634810399, 0.366416823997444, 0.366416823997444, 0.7433027001091, -1.77670994843448, 0.334504033501552, 0.499014213912152, 0.608687667519218, 0.334504033501552, -1.49845255607925,
+#> -0.571418013271602, 0.689956856450286, 0.689956856450286, 0.689956856450286, -2.01837516818398, 0.655971929659792, -0.504593792045994, 0.681201619262092, 0.80735006727359, 0.353215654432196, 0.0252296896022997, NA, NA, -0.558135672856483, -0.81349186305226, -1.10532750899029, 1.17463847490057, -0.667574040083244, 0.846323373220288, 1.24759738638508, -0.886450774536767, -0.521656217114229, 1.28407684212733, -1.35607145203054, 0.161918979346931, -0.521176714772932, 0.41491738457651, 1.30041180288004,
+#> -1.15113847167573, 0.497082521859975, 0.654055949815756)]
+#> Groups: playerID [1,322]
+#>
+#> playerID yearID teamID G AB R H G_z
+#> <chr> <int> <fctr> <int> <int> <int> <int> <dbl>
+#> 1 bondto01 1874 BR2 55 245 25 54 0.39424925
+#> 2 bondto01 1875 HR1 72 289 32 77 1.02437412
+#> 3 bondto01 1876 HAR 45 182 18 50 0.02358756
+#> 4 bondto01 1877 BSN 61 259 32 59 0.61664626
+#> # ... with 19,109 more rows
dplyr is the next iteration of plyr, focussed on tools for working with data frames (hence the d
in the name). It has three main goals:
Identify the most important data manipulation tools needed for data analysis and make them easy to use from R.
Provide blazing fast performance for in-memory data by writing key pieces in C++.
Use the same interface to work with data no matter where it’s stored, whether in a data frame, a data table or database.
You can install:
+the latest released version from CRAN with
+install.packages("dplyr")
the latest development version from github with
+if (packageVersion("devtools") < 1.6) {
+ install.packages("devtools")
+}
+devtools::install_github("tidyverse/lazyeval")
+devtools::install_github("tidyverse/dplyr")
You’ll probably also want to install the data packages used in most examples: install.packages(c("nycflights13", "Lahman"))
.
If you encounter a clear bug, please file a minimal reproducible example on github. For questions and other discussion, please use the manipulatr mailing list.
+To get started, read the notes below, then read the intro vignette: vignette("introduction", package = "dplyr")
. To make the most of dplyr, I also recommend that you familiarise yourself with the principles of tidy data: this will help you get your data into a form that works well with dplyr, ggplot2 and R’s many modelling functions.
If you need more help, I recommend the following (paid) resources:
+dplyr on datacamp, by Garrett Grolemund. Learn the basics of dplyr at your own pace in this interactive online course.
Introduction to Data Science with R: How to Manipulate, Visualize, and Model Data with the R Language, by Garrett Grolemund. This O’Reilly video series will teach you the basics needed to be an effective analyst in R.
The key object in dplyr is a tbl, a representation of a tabular data structure. Currently dplyr
supports:
You can create them as follows:
+library(dplyr) # for functions
+library(nycflights13) # for data
+flights
+#> # A tibble: 336,776 × 19
+#> year month day dep_time sched_dep_time dep_delay arr_time
+#> <int> <int> <int> <int> <int> <dbl> <int>
+#> 1 2013 1 1 517 515 2 830
+#> 2 2013 1 1 533 529 4 850
+#> 3 2013 1 1 542 540 2 923
+#> 4 2013 1 1 544 545 -1 1004
+#> 5 2013 1 1 554 600 -6 812
+#> 6 2013 1 1 554 558 -4 740
+#> 7 2013 1 1 555 600 -5 913
+#> 8 2013 1 1 557 600 -3 709
+#> 9 2013 1 1 557 600 -3 838
+#> 10 2013 1 1 558 600 -2 753
+#> # ... with 336,766 more rows, and 12 more variables: sched_arr_time <int>,
+#> # arr_delay <dbl>, carrier <chr>, flight <int>, tailnum <chr>,
+#> # origin <chr>, dest <chr>, air_time <dbl>, distance <dbl>, hour <dbl>,
+#> # minute <dbl>, time_hour <dttm>
+
+# Caches data in local SQLite db
+flights_db1 <- tbl(dbplyr::nycflights13_sqlite(), "flights")
+
+# Caches data in local postgres db
+flights_db2 <- tbl(dbplyr::nycflights13_postgres(host = "localhost"), "flights")
Each tbl also comes in a grouped variant which allows you to easily perform operations “by group”:
+ +dplyr
implements the following verbs useful for data manipulation:
select()
: focus on a subset of variablesfilter()
: focus on a subset of rowsmutate()
: add new columnssummarise()
: reduce each group to a smaller number of summary statisticsarrange()
: re-order the rowsThey all work as similarly as possible across the range of data sources. The main difference is performance:
+system.time(carriers_df %>% summarise(delay = mean(arr_delay)))
+#> user system elapsed
+#> 0.051 0.001 0.052
+system.time(carriers_db1 %>% summarise(delay = mean(arr_delay)) %>% collect())
+#> user system elapsed
+#> 0.236 0.142 0.381
+system.time(carriers_db2 %>% summarise(delay = mean(arr_delay)) %>% collect())
+#> user system elapsed
+#> 0.012 0.000 0.207
Data frame methods are much much faster than the plyr equivalent. The database methods are slower, but can work with data that don’t fit in memory.
+system.time(plyr::ddply(flights, "carrier", plyr::summarise,
+ delay = mean(arr_delay, na.rm = TRUE)))
+#> user system elapsed
+#> 0.121 0.040 0.162
As well as verbs that work on a single tbl, there are also a set of useful verbs that work with two tbls at a time: joins and set operations.
+dplyr implements the four most useful joins from SQL:
+inner_join(x, y)
: matching x + yleft_join(x, y)
: all x + matching ysemi_join(x, y)
: all x with match in yanti_join(x, y)
: all x without match in yAnd provides methods for:
+intersect(x, y)
: all rows in both x and yunion(x, y)
: rows in either x or ysetdiff(x, y)
: rows in x, but not yYou’ll need to be a little careful if you load both plyr and dplyr at the same time. I’d recommend loading plyr first, then dplyr, so that the faster dplyr functions come first in the search path. By and large, any function provided by both dplyr and plyr works in a similar way, although dplyr functions tend to be faster and more general.
+Five new datasets provide some interesting built-in datasets to demonstrate dplyr verbs (#2094):
starwars
dataset about starwars characters; has list columnsstorms
has the trajectories of ~200 tropical stormsband_members
, band_instruments
and band_instruments2
has some simple data to demonstrate joins.
New add_count()
and add_tally()
for adding an n
column within groups (#2078, @dgrtwo).
arrange()
for grouped data frames gains a .by_group
argument so you can choose to sort by groups if you want to (defaults to FALSE
) (#2318)
New pull()
generic for extracting a single column either by name (as a string) or a position (either from the left or the right). Thanks to @paulponcet for the idea (#2054).
as_tibble()
is re-exported from tibble. This is the recommend way to create tibbles from existing data frames. tbl_df()
has been softly deprecated. tribble()
is now imported from tibble (#2336, @chrMongeau); this is now prefered to frame_data()
.
dplyr no longer messages that you need dtplyr to work with data.table (#2489).
Long deprecated regroup()
has been removed.
Deprecated failwith()
. I’m not even sure why it was here.
This version of dplyr includes some major changes to how database connections work. By and large, you should be able to continue using your existing dplyr database code without modification, but there are two big changes that you should be aware of:
+Almost all database related code has been moved out of dplyr and into a new package, dbplyr. This makes dplyr simpler, and will make it easier to release fixes for bugs that only affect databases. src_mysql()
, src_postgres()
, and src_sqlite()
will still live dplyr so your existing code continues to work.
It is no longer necessary to create a remote “src”. Instead you can work directly with the database connection returned by DBI. This reflects the maturity of the DBI ecosystem. Thanks largely to the work of Kirill Muller (funded by the R Consortium) DBI backends are now much more consistent, comprehensive, and easier to use. That means that there’s no longer a need for a layer in between you and DBI.
You can continue to use src_mysql()
, src_postgres()
, and src_sqlite()
, but I recommend a new style that makes the connection to DBI more clear:
library(dplyr)
+
+con <- DBI::dbConnect(RSQLite::SQLite(), ":memory:")
+dbWriteTable(con, "mtcars", mtcars)
+
+mtcars2 <- tbl(con, "mtcars")
+mtcars2
This is particularly useful if you want to perform non-SELECT queries as you can do whatever you want with DBI::dbGetQuery()
and DBI::dbExecute()
.
If you’ve implemented a database backend for dplyr, please read the backend news to see what’s changed from your perspective (not much).
+Internally, column names are always represented as character vectors, and not as language symbols, to avoid encoding problems on Windows (#1950, #2387, #2388).
Error messages and explanations of data frame inequality are now encoded in UTF-8, also on Windows (#2441).
Joins now always reencode character columns to UTF-8 if necessary. This gives a nice speedup, because now pointer comparison can be used instead of string comparison, but relies on a proper encoding tag for all strings (#2514).
Fixed problems when joining factor or character encodings with a mix of native and UTF-8 encoded values (#1885, #2118, #2271, #2451).
Fix group_by()
for data frames that have UTF-8 encoded names (#2284, #2382).
New group_vars()
generic that returns the grouping as character vector, to avoid the potentially lossy conversion to language symbols. The list returned by group_by_prepare()
now has a new group_names
component (#1950, #2384).
rename()
, select()
, group_by()
, filter()
and transmute()
now have scoped variants (verbs suffixed with _if()
, _at()
and _all()
). Like mutate_all()
, summarise_if()
, etc, these variants apply an operation to a selection of variables.
The scoped verbs taking predicates (mutate_if()
, summarise_if()
, etc) now support S3 objects and lazy tables. S3 objects should implement methods for length()
, [[
and tbl_vars()
. For lazy tables, the first 100 rows are collected and the predicate is applied on this subset of the data. This is robust for the common case of checking the type of a column (#2129).
Summarise and mutate colwise functions pass ...
on the the manipulation functions.
The performance of colwise verbs like mutate_all()
is now back to where it was in mutate_each()
.
funs()
has better handling of namespaced functions (#2089).
Fix issue with mutate_if()
and summarise_if()
when a predicate function returns a vector of FALSE
(#1989, #2009, #2011, @lionel-).
dplyr has a new approach to non-standard evaluation (NSE) called tidyeval. Tidyeval is described in detail in vignette("programming-dplyr")
but, in brief, gives you the ability to interpolate values in contexts where dplyr usually works with expressions:
my_var <- quo(homeworld)
+
+starwars %>%
+ group_by(!!my_var) %>%
+ summarise_at(vars(height:mass), mean, na.rm = TRUE)
+This means that the underscored version of each main verb is no longer needed, and so these functions have been deprecated (but remain around for backward compatibility).
+order_by()
, top_n()
, sample_n()
and sample_frac()
now use tidyeval to capture their arguments by expression. This makes it possible to use unquoting idioms (see vignette("programming")
) and fixes scoping issues (#2297).
Most verbs taking dots now ignore the last argument if empty. This makes it easier to copy lines of code without having to worry about deleting trailing commas (#1039).
[API] The new .data
and .env
environments can be used inside all verbs that operate on data: .data$column_name
accesses the column column_name
, whereas .env$var
accesses the external variable var
. Columns or external variables named .data
or .env
are shadowed, use .data$...
and/or .env$...
to access them.
The column()
and global()
functions have been removed. They were never documented officially. Use the new .data
and .env
environments instead.
Expressions in verbs are now interpreted correctly in many cases that failed before (e.g., use of $
, case_when()
, nonstandard evaluation, …). These expressions are now evaluated in a specially constructed temporary environment that retrieves column data on demand with the help of the bindrcpp
package (#2190). This temporary environment poses restrictions on assignments using <-
inside verbs. To prevent leaking of broken bindings, the temporary environment is cleared after the evaluation (#2435).
[API] xxx_join.tbl_df()
by default treats all NA
values as different from each other (and from any other value), so that they never match. This corresponds to the behavior of joins for database sources, and of database joins in general. To match NA
values, pass na_matches = "na"
to the join verbs; this is only supported for data frames. The default can also be tweaked by calling pkgconfig::set_config("dplyr::na_matches", "na")
(#2033).
common_by()
gets a better error message for unexpected inputs (#2091)
Fix groups when joining grouped data frames with duplicate columns (#2330, #2334, @davidkretch).
One of the two join suffixes can now be an empty string, dplyr no longer hangs (#2228, #2445).
For selecting variables, the first selector decides if it’s an inclusive selection (i.e., the initial column list is empty), or an exclusive selection (i.e., the initial column list contains all columns). This means that select(mtcars, contains("am"), contains("FOO"), contains("vs"))
now returns again both am
and vs
columns like in dplyr 0.4.3 (#2275, #2289, @r2evans).
Select helpers now throw an error if called when no variables have been set (#2452)
Helper functions in select()
(and related verbs) are now evaluated in a context where column names do not exist (#2184).
recode()
, case_when()
and coalesce()
now support splicing of arguments with rlang’s !!!
operator.
count()
now preserves the grouping of its input (#2021).
distinct()
no longer duplicates variables (#2001).
Empty distinct()
with a grouped data frame works the same way as an empty distinct()
on an ungrouped data frame, namely it uses all variables (#2476).
copy_to()
now returns it’s output invisibly (since you’re often just calling for the side-effect).
filter()
and lag()
throw informative error if used with ts objects (#2219)
mutate()
recycles list columns of length 1 (#2171).
mutate()
gives better error message when attempting to add a non-vector column (#2319), or attempting to remove a column with NULL
(#2187, #2439).
summarise()
now correctly evaluates newly created factors (#2217), and can create ordered factors (#2200).
Ungrouped summarise()
uses summary variables correctly (#2404, #2453).
Grouped summarise()
no longer converts character NA
to empty strings (#1839).
all_equal()
now reports multiple problems as a character vector (#1819, #2442).
all_equal()
checks that factor levels are equal (#2440, #2442).
bind_rows()
and bind_cols()
give an error for database tables (#2373).
bind_rows()
works correctly with NULL
arguments and an .id
argument (#2056), and also for zero-column data frames (#2175).
Breaking change: bind_rows()
and combine()
are more strict when coercing. Logical values are no longer coerced to integer and numeric. Date, POSIXct and other integer or double-based classes are no longer coerced to integer or double as there is chance of attributes or information being lost (#2209, @zeehio).
bind_cols()
now calls tibble::repair_names()
to ensure that all names are unique (#2248).
bind_cols()
handles empty argument list (#2048).
bind_cols()
better handles NULL
inputs (#2303, #2443).
bind_rows()
explicitly rejects data frame columns (#2015, #2446).
combine()
accepts NA
values (#2203, @zeehio)
combine()
and bind_rows()
with character and factor types now always warn about the coercion to character (#2317, @zeehio)
combine()
and bind_rows()
accept difftime
objects.
mutate
coerces results from grouped dataframes accepting combinable data types (such as integer
and numeric
). (#1892, @zeehio)
tbl_df
gains rbind()
and cbind()
methods that call bind_rows()
and bind_cols()
respectively (#2138)
%in%
gets new hybrid handler (#126).
between()
returns NA if left
or right
is NA
(fixes #2562).
case_when()
supports NA
values (#2000, @tjmahr).
first()
, last()
, and nth()
have better default values for factor, Dates, POSIXct, and data frame inputs (#2029).
Fixed segmentation faults in hybrid evaluation of first()
, last()
, nth()
, lead()
, and lag()
. These functions now always fall back to the R implementation if called with arguments that the hybrid evaluator cannot handle (#948, #1980).
n_distinct()
gets larger hash tables given slightly better performance (#977).
nth()
and ntile()
are more careful about proper data types of their return values (#2306).
ntile()
ignores NA
when computing group membership (#2564).
lag()
enforces integer n
(#2162, @kevinushey).
hybrid min()
and max()
now always return a numeric
and work correctly in edge cases (empty input, all NA
, …) (#2305, #2436).
min_rank("string")
no longer segfaults in hybrid evaluation (#2279, #2444).
recode()
can now recode a factor to other types (#2268)
recode()
gains .dots
argument to support passing replacements as list (#2110, @jlegewie).
New is_grouped_df()
alias to is.grouped_df()
.
tbl_vars()
now has a group_vars
argument set to TRUE
by default. If FALSE
, group variables are not returned.
Fixed segmentation fault after calling rename()
on an invalid grouped data frame (#2031).
rename_vars()
gains a strict
argument to control if an error is thrown when you try and rename a variable that doesn’t exist.
Fixed undefined behavior for slice()
on a zero-column data frame (#2490).
Fixed very rare case of false match during join (#2515).
Restricted workaround for match()
to R 3.3.0. (#1858).
dplyr now warns on load when the version of R or Rcpp during installation is different to the currently installed version (#2514).
Fixed improper reuse of attributes when creating a list column in summarise()
and perhaps mutate()
(#2231).
mutate()
and summarise()
always strip the names
attribute from new or updated columns, even for ungrouped operations (#1689).
Fixed rare error that could lead to a segmentation fault in all_equal(ignore_col_order = FALSE)
(#2502).
The “dim” and “dimnames” attributes are always stripped when copying a vector (#1918, #2049).
grouped_df
is registered officially as an S3 class. This makes it easier to use with S4 (#2276, , @joranE).
Makeflags uses PKG_CPPFLAGS for defining preprocessor macros.
astyle formatting for C++ code, tested but not changed as part of the tests (#2086, #2103).
Update RStudio project settings to install tests (#1952).
arrange()
once again ignores grouping (#1206).
distinct()
now only keeps the distinct variables. If you want to return all variables (using the first row for non-distinct values) use .keep_all = TRUE
(#1110). For SQL sources, .keep_all = FALSE
is implemented using GROUP BY
, and .keep_all = TRUE
raises an error (#1937, #1942, @krlmlr). (The default behaviour of using all variables when none are specified remains - this note only applies if you select some variables).
The select helper functions starts_with()
, ends_with()
etc are now real exported functions. This means that you’ll need to import those functions if you’re using from a package where dplyr is not attached. i.e. dplyr::select(mtcars, starts_with("m"))
used to work, but now you’ll need dplyr::select(mtcars, dplyr::starts_with("m"))
.
The long deprecated chain()
, chain_q()
and %.%
have been removed. Please use %>%
instead.
id()
has been deprecated. Please use group_indices()
instead (#808).
rbind_all()
and rbind_list()
are formally deprecated. Please use bind_rows()
instead (#803).
Outdated benchmarking demos have been removed (#1487).
Code related to starting and signalling clusters has been moved out to multidplyr.
coalesce()
finds the first non-missing value from a set of vectors. (#1666, thanks to @krlmlr for initial implementation).
case_when()
is a general vectorised if + else if (#631).
if_else()
is a vectorised if statement: it’s a stricter (type-safe), faster, and more predictable version of ifelse()
. In SQL it is translated to a CASE
statement.
na_if()
makes it easy to replace a certain value with an NA
(#1707). In SQL it is translated to NULL_IF
.
near(x, y)
is a helper for abs(x - y) < tol
(#1607).
recode()
is vectorised equivalent to switch()
(#1710).
union_all()
method. Maps to UNION ALL
for SQL sources, bind_rows()
for data frames/tbl_dfs, and combine()
for vectors (#1045).
A new family of functions replace summarise_each()
and mutate_each()
(which will thus be deprecated in a future release). summarise_all()
and mutate_all()
apply a function to all columns while summarise_at()
and mutate_at()
operate on a subset of columns. These columuns are selected with either a character vector of columns names, a numeric vector of column positions, or a column specification with select()
semantics generated by the new columns()
helper. In addition, summarise_if()
and mutate_if()
take a predicate function or a logical vector (these verbs currently require local sources). All these functions can now take ordinary functions instead of a list of functions generated by funs()
(though this is only useful for local sources). (#1845, @lionel-)
select_if()
lets you select columns with a predicate function. Only compatible with local sources. (#497, #1569, @lionel-)
All data table related code has been separated out in to a new dtplyr package. This decouples the development of the data.table interface from the development of the dplyr package. If both data.table and dplyr are loaded, you’ll get a message reminding you to load dtplyr.
+Functions related to the creation and coercion of tbl_df
s, now live in their own package: tibble. See vignette("tibble")
for more details.
$
and [[
methods that never do partial matching (#1504), and throw an error if the variable does not exist.
all_equal()
allows to compare data frames ignoring row and column order, and optionally ignoring minor differences in type (e.g. int vs. double) (#821). The test handles the case where the df has 0 columns (#1506). The test fails fails when convert is FALSE
and types don’t match (#1484).
all_equal()
shows better error message when comparing raw values or when types are incompatible and convert = TRUE
(#1820, @krlmlr).
add_row()
makes it easy to add a new row to data frame (#1021)
as_data_frame()
is now an S3 generic with methods for lists (the old as_data_frame()
), data frames (trivial), and matrices (with efficient C++ implementation) (#876). It no longer strips subclasses.
The internals of data_frame()
and as_data_frame()
have been aligned, so as_data_frame()
will now automatically recycle length-1 vectors. Both functions give more informative error messages if you attempting to create an invalid data frame. You can no longer create a data frame with duplicated names (#820). Both check for POSIXlt
columns, and tell you to use POSIXct
instead (#813).
frame_data()
properly constructs rectangular tables (#1377, @kevinushey), and supports list-cols.
glimpse()
is now a generic. The default method dispatches to str()
(#1325). It now (invisibly) returns its first argument (#1570).
lst()
and lst_()
which create lists in the same way that data_frame()
and data_frame_()
create data frames (#1290).
print.tbl_df()
is considerably faster if you have very wide data frames. It will now also only list the first 100 additional variables not already on screen - control this with the new n_extra
parameter to print()
(#1161). When printing a grouped data frame the number of groups is now printed with thousands separators (#1398). The type of list columns is correctly printed (#1379)
Package includes setOldClass(c("tbl_df", "tbl", "data.frame"))
to help with S4 dispatch (#969).
tbl_df
automatically generates column names (#1606).
new as_data_frame.tbl_cube()
(#1563, @krlmlr).
tbl_cube
s are now constructed correctly from data frames, duplicate dimension values are detected, missing dimension values are filled with NA
. The construction from data frames now guesses the measure variables by default, and allows specification of dimension and/or measure variables (#1568, @krlmlr).
Swap order of dim_names
and met_name
arguments in as.tbl_cube
(for array
, table
and matrix
) for consistency with tbl_cube
and as.tbl_cube.data.frame
. Also, the met_name
argument to as.tbl_cube.table
now defaults to "Freq"
for consistency with as.data.frame.table
(@krlmlr, #1374).
as_data_frame()
on SQL sources now returns all rows (#1752, #1821, @krlmlr).
compute()
gets new parameters indexes
and unique_indexes
that make it easier to add indexes (#1499, @krlmlr).
db_explain()
gains a default method for DBIConnections (#1177).
The backend testing system has been improved. This lead to the removal of temp_srcs()
. In the unlikely event that you were using this function, you can instead use test_register_src()
, test_load()
, and test_frame()
.
You can now use right_join()
and full_join()
with remote tables (#1172).
src_memdb()
is a session-local in-memory SQLite database. memdb_frame()
works like data_frame()
, but creates a new table in that database.
src_sqlite()
now uses a stricter quoting character, `
, instead of "
. SQLite “helpfully” will convert "x"
into a string if there is no identifier called x in the current scope (#1426).
src_sqlite()
throws errors if you try and use it with window functions (#907).
filter.tbl_sql()
now puts parens around each argument (#934).
Unary -
is better translated (#1002).
escape.POSIXt()
method makes it easier to use date times. The date is rendered in ISO 8601 format in UTC, which should work in most databases (#857).
is.na()
gets a missing space (#1695).
if
, is.na()
, and is.null()
get extra parens to make precendence more clear (#1695).
pmin()
and pmax()
are translated to MIN()
and MAX()
(#1711).
Window functions:
+Work on ungrouped data (#1061).
Warning if order is not set on cumulative window functions.
Multiple partitions or ordering variables in windowed functions no longer generate extra parentheses, so should work for more databases (#1060)
This version includes an almost total rewrite of how dplyr verbs are translated into SQL. Previously, I used a rather ad-hoc approach, which tried to guess when a new subquery was needed. Unfortunately this approach was fraught with bugs, so in this version I’ve implemented a much richer internal data model. Now there is a three step process:
+When applied to a tbl_lazy
, each dplyr verb captures its inputs and stores in a op
(short for operation) object.
sql_build()
iterates through the operations building to build up an object that represents a SQL query. These objects are convenient for testing as they are lists, and are backend agnostics.
sql_render()
iterates through the queries and generates the SQL, using generics (like sql_select()
) that can vary based on the backend.
In the short-term, this increased abstraction is likely to lead to some minor performance decreases, but the chance of dplyr generating correct SQL is much much higher. In the long-term, these abstractions will make it possible to write a query optimiser/compiler in dplyr, which would make it possible to generate much more succinct queries.
+If you have written a dplyr backend, you’ll need to make some minor changes to your package:
+sql_join()
has been considerably simplified - it is now only responsible for generating the join query, not for generating the intermediate selects that rename the variable. Similarly for sql_semi_join()
. If you’ve provided new methods in your backend, you’ll need to rewrite.
select_query()
gains a distinct argument which is used for generating queries for distinct()
. It loses the offset
argument which was never used (and hence never tested).
src_translate_env()
has been replaced by sql_translate_env()
which should have methods for the connection object.
There were two other tweaks to the exported API, but these are less likely to affect anyone.
+translate_sql()
and partial_eval()
got a new API: now use connection + variable names, rather than a tbl
. This makes testing considerably easier. translate_sql_q()
has been renamed to translate_sql_()
.
Also note that the sql generation generics now have a default method, instead methods for DBIConnection and NULL.
Avoiding segfaults in presence of raw
columns (#1803, #1817, @krlmlr).
arrange()
fails gracefully on list columns (#1489) and matrices (#1870, #1945, @krlmlr).
count()
now adds additional grouping variables, rather than overriding existing (#1703). tally()
and count()
can now count a variable called n
(#1633). Weighted count()
/tally()
ignore NA
s (#1145).
The progress bar in do()
is now updated at most 20 times per second, avoiding uneccessary redraws (#1734, @mkuhn)
distinct()
doesn’t crash when given a 0-column data frame (#1437).
filter()
throws an error if you supply an named arguments. This is usually a type: filter(df, x = 1)
instead of filter(df, x == 1)
(#1529).
summarise()
correctly coerces factors with different levels (#1678), handles min/max of already summarised variable (#1622), and supports data frames as columns (#1425).
select()
now informs you that it adds missing grouping variables (#1511). It works even if the grouping variable has a non-syntactic name (#1138). Negating a failed match (e.g. select(mtcars, -contains("x"))
) returns all columns, instead of no columns (#1176)
The select()
helpers are now exported and have their own documentation (#1410). one_of()
gives a useful error message if variables names are not found in data frame (#1407).
The naming behaviour of summarise_each()
and mutate_each()
has been tweaked so that you can force inclusion of both the function and the variable name: summarise_each(mtcars, funs(mean = mean), everything())
(#442).
mutate()
handles factors that are all NA
(#1645), or have different levels in different groups (#1414). It disambiguates NA
and NaN
(#1448), and silently promotes groups that only contain NA
(#1463). It deep copies data in list columns (#1643), and correctly fails on incompatible columns (#1641). mutate()
on a grouped data no longer droups grouping attributes (#1120). rowwise()
mutate gives expected results (#1381).
one_of()
tolerates unknown variables in vars
, but warns (#1848, @jennybc).
print.grouped_df()
passes on ...
to print()
(#1893).
slice()
correctly handles grouped attributes (#1405).
ungroup()
generic gains ...
(#922).
bind_cols()
matches the behaviour of bind_rows()
and ignores NULL
inputs (#1148). It also handles POSIXct
s with integer base type (#1402).
bind_rows()
handles 0-length named lists (#1515), promotes factors to characters (#1538), and warns when binding factor and character (#1485). bind_rows()` is more flexible in the way it can accept data frames, lists, list of data frames, and list of lists (#1389).
bind_rows()
rejects POSIXlt
columns (#1875, @krlmlr).
Both bind_cols()
and bind_rows()
infer classes and grouping information from the first data frame (#1692).
rbind()
and cbind()
get grouped_df()
methods that make it harder to
+create corrupt data frames (#1385). You should still prefer bind_rows()
and bind_cols()
.
Joins now use correct class when joining on POSIXct
columns (#1582, @joel23888), and consider time zones (#819). Joins handle a by
that is empty (#1496), or has duplicates (#1192). Suffixes grow progressively to avoid creating repeated column names (#1460). Joins on string columns should be substantially faster (#1386). Extra attributes are ok if they are identical (#1636). Joins work correct when factor levels not equal (#1712, #1559), and anti and semi joins give correct result when by variable is a factor (#1571). A clear error message is given for joins where an explicit by
contains unavailable columns (#1928, #1932, @krlmlr).
inner_join()
, left_join()
, right_join()
, and full_join()
gain a suffix
argument which allows you to control what suffix duplicated variable names recieve (#1296).
Set operations (intersect()
, union()
etc) respect coercion rules (#799). setdiff()
handles factors with NA
levels (#1526).
There were a number of fixes to enable joining of data frames that don’t have the same encoding of column names (#1513), including working around bug 16885 regarding match()
in R 3.3.0 (#1806, #1810, @krlmlr).
combine()
silently drops NULL
inputs (#1596).
Hybrid cummean()
is more stable against floating point errors (#1387).
Hybrid lead()
and lag()
received a considerable overhaul. They are more careful about more complicated expressions (#1588), and falls back more readily to pure R evaluation (#1411). They behave correctly in summarise()
(#1434). and handle default values for string columns.
Hybrid min()
and max()
handle empty sets (#1481).
n_distinct()
uses multiple arguments for data frames (#1084), falls back to R evaluation when needed (#1657), reverting decision made in (#567). Passing no arguments gives an error (#1957, #1959, @krlmlr).
nth()
now supports negative indices to select from end, e.g. nth(x, -2)
selects the 2nd value from the end of x
(#1584).
top_n()
can now also select bottom n
values by passing a negative value to n
(#1008, #1352).
Hybrid evaluation leaves formulas untouched (#1447).
Until now, dplyr’s support for non-UTF8 encodings has been rather shaky. This release brings a number of improvement to fix these problems: it’s probably not perfect, but should be a lot better than the previously version. This includes fixes to arrange()
(#1280), bind_rows()
(#1265), distinct()
(#1179), and joins (#1315). print.tbl_df()
also recieved a fix for strings with invalid encodings (#851).
frame_data()
provides a means for constructing data_frame
s using a simple row-wise language. (#1358, @kevinushey)
all.equal()
no longer runs all outputs together (#1130).
as_data_frame()
gives better error message with NA column names (#1101).
[.tbl_df
is more careful about subsetting column names (#1245).
arrange()
, filter()
, slice()
, and summarise()
preserve data frame meta attributes (#1064).
bind_rows()
and bind_cols()
accept lists (#1104): during initial data cleaning you no longer need to convert lists to data frames, but can instead feed them to bind_rows()
directly.
bind_rows()
gains a .id
argument. When supplied, it creates a new column that gives the name of each data frame (#1337, @lionel-).
bind_rows()
respects the ordered
attribute of factors (#1112), and does better at comparing POSIXct
s (#1125). The tz
attribute is ignored when determining if two POSIXct
vectors are comparable. If the tz
of all inputs is the same, it’s used, otherwise its set to UTC
.
data_frame()
always produces a tbl_df
(#1151, @kevinushey)
filter(x, TRUE, TRUE)
now just returns x
(#1210), it doesn’t internally modify the first argument (#971), and it now works with rowwise data (#1099). It once again works with data tables (#906).
glimpse()
also prints out the number of variables in addition to the number of observations (@ilarischeinin, #988).
Joins handles matrix columns better (#1230), and can join Date
objects with heterogenous representations (some Date
s are integers, while other are numeric). This also improves all.equal()
(#1204).
Fixed percent_rank()
and cume_dist()
so that missing values no longer affect denominator (#1132).
print.tbl_df()
now displays the class for all variables, not just those that don’t fit on the screen (#1276). It also displays duplicated column names correctly (#1159).
print.grouped_df()
now tells you how many groups there are.
mutate()
can set to NULL
the first column (used to segfault, #1329) and it better protects intermediary results (avoiding random segfaults, #1231).
mutate()
on grouped data handles the special case where for the first few groups, the result consists of a logical
vector with only NA
. This can happen when the condition of an ifelse
is an all NA
logical vector (#958).
mutate.rowwise_df()
handles factors (#886) and correctly handles 0-row inputs (#1300).
n_distinct()
gains an na_rm
argument (#1052).
The Progress
bar used by do()
now respects global option dplyr.show_progress
(default is TRUE) so you can turn it off globally (@jimhester #1264, #1226).
summarise()
handles expressions that returning heterogenous outputs, e.g. median()
, which that sometimes returns an integer, and other times a numeric (#893).
slice()
silently drops columns corresponding to an NA (#1235).
ungroup.rowwise_df()
gives a tbl_df
(#936).
More explicit duplicated column name error message (#996).
When “,” is already being used as the decimal point (getOption("OutDec")
), use “.” as the thousands separator when printing out formatted numbers (@ilarischeinin, #988).
db_query_fields.SQLiteConnection
uses build_sql
rather than paste0
(#926, @NikNakk)
Improved handling of log()
(#1330).
n_distinct(x)
is translated to COUNT(DISTINCT(x))
(@skparkes, #873).
print(n = Inf)
now works for remote sources (#1310).
Hybrid evaluation does not take place for objects with a class (#1237).
Improved $
handling (#1134).
Simplified code for lead()
and lag()
and make sure they work properly on factors (#955). Both repsect the default
argument (#915).
mutate
can set to NULL
the first column (used to segfault, #1329).
filter
on grouped data handles indices correctly (#880).
sum()
issues a warning about integer overflow (#1108).
This is a minor release containing fixes for a number of crashes and issues identified by R CMD CHECK. There is one new “feature”: dplyr no longer complains about unrecognised attributes, and instead just copies them over to the output.
+lag()
and lead()
for grouped data were confused about indices and therefore produced wrong results (#925, #937). lag()
once again overrides lag()
instead of just the default method lag.default()
. This is necesary due to changes in R CMD check. To use the lag function provided by another package, use pkg::lag
.
Fixed a number of memory issues identified by valgrind.
Improved performance when working with large number of columns (#879).
Lists-cols that contain data frames now print a slightly nicer summary (#1147)
Set operations give more useful error message on incompatible data frames (#903).
all.equal()
gives the correct result when ignore_row_order
is TRUE
(#1065) and all.equal()
correctly handles character missing values (#1095).
bind_cols()
always produces a tbl_df
(#779).
bind_rows()
gains a test for a form of data frame corruption (#1074).
bind_rows()
and summarise()
now handles complex columns (#933).
Workaround for using the constructor of DataFrame
on an unprotected object (#998)
Improved performance when working with large number of columns (#879).
add_rownames()
turns row names into an explicit variable (#639).
as_data_frame()
efficiently coerces a list into a data frame (#749).
bind_rows()
and bind_cols()
efficiently bind a list of data frames by row or column. combine()
applies the same coercion rules to vectors (it works like c()
or unlist()
but is consistent with the bind_rows()
rules).
right_join()
(include all rows in y
, and matching rows in x
) and full_join()
(include all rows in x
and y
) complete the family of mutating joins (#96).
group_indices()
computes a unique integer id for each group (#771). It can be called on a grouped_df without any arguments or on a data frame with same arguments as group_by()
.
vignette("data_frames")
describes dplyr functions that make it easier and faster to create and coerce data frames. It subsumes the old memory
vignette.
vignette("two-table")
describes how two-table verbs work in dplyr.
data_frame()
(and as_data_frame()
& tbl_df()
) now explicitly forbid columns that are data frames or matrices (#775). All columns must be either a 1d atomic vector or a 1d list.
do()
uses lazyeval to correctly evaluate its arguments in the correct environment (#744), and new do_()
is the SE equivalent of do()
(#718). You can modify grouped data in place: this is probably a bad idea but it’s sometimes convenient (#737). do()
on grouped data tables now passes in all columns (not all columns except grouping vars) (#735, thanks to @kismsu). do()
with database tables no longer potentially includes grouping variables twice (#673). Finally, do()
gives more consistent outputs when there are no rows or no groups (#625).
first()
and last()
preserve factors, dates and times (#509).
Overhaul of single table verbs for data.table backend. They now all use a consistent (and simpler) code base. This ensures that (e.g.) n()
now works in all verbs (#579).
In *_join()
, you can now name only those variables that are different between the two tables, e.g. inner_join(x, y, c("a", "b", "c" = "d"))
(#682). If non-join colums are the same, dplyr will add .x
and .y
suffixes to distinguish the source (#655).
mutate()
handles complex vectors (#436) and forbids POSIXlt
results (instead of crashing) (#670).
select()
now implements a more sophisticated algorithm so if you’re doing multiples includes and excludes with and without names, you’re more likely to get what you expect (#644). You’ll also get a better error message if you supply an input that doesn’t resolve to an integer column position (#643).
Printing has recieved a number of small tweaks. All print()
method methods invisibly return their input so you can interleave print()
statements into a pipeline to see interim results. print()
will column names of 0 row data frames (#652), and will never print more 20 rows (i.e. options(dplyr.print_max)
is now 20), not 100 (#710). Row names are no never printed since no dplyr method is guaranteed to preserve them (#669).
glimpse()
prints the number of observations (#692)
type_sum()
gains a data frame method.
summarise()
handles list output columns (#832)
slice()
works for data tables (#717). Documentation clarifies that slice can’t work with relational databases, and the examples show how to achieve the same results using filter()
(#720).
dplyr now requires RSQLite >= 1.0. This shouldn’t affect your code in any way (except that RSQLite now doesn’t need to be attached) but does simplify the internals (#622).
Functions that need to combine multiple results into a single column (e.g. join()
, bind_rows()
and summarise()
) are more careful about coercion.
Joining factors with the same levels in the same order preserves the original levels (#675). Joining factors with non-identical levels generates a warning and coerces to character (#684). Joining a character to a factor (or vice versa) generates a warning and coerces to character. Avoid these warnings by ensuring your data is compatible before joining.
+rbind_list()
will throw an error if you attempt to combine an integer and factor (#751). rbind()
ing a column full of NA
s is allowed and just collects the appropriate missing value for the column type being collected (#493).
summarise()
is more careful about NA
, e.g. the decision on the result type will be delayed until the first non NA value is returned (#599). It will complain about loss of precision coercions, which can happen for expressions that return integers for some groups and a doubles for others (#599).
A number of functions gained new or improved hybrid handlers: first()
, last()
, nth()
(#626), lead()
& lag()
(#683), %in%
(#126). That means when you use these functions in a dplyr verb, we handle them in C++, rather than calling back to R, and hence improving performance.
Hybrid min_rank()
correctly handles NaN
values (#726). Hybrid implementation of nth()
falls back to R evaluation when n
is not a length one integer or numeric, e.g. when it’s an expression (#734).
Hybrid dense_rank()
, min_rank()
, cume_dist()
, ntile()
, row_number()
and percent_rank()
now preserve NAs (#774)
filter
returns its input when it has no rows or no columns (#782).
Join functions keep attributes (e.g. time zone information) from the left argument for POSIXct
and Date
objects (#819), and only only warn once about each incompatibility (#798).
[.tbl_df
correctly computes row names for 0-column data frames, avoiding problems with xtable (#656). [.grouped_df
will silently drop grouping if you don’t include the grouping columns (#733).
data_frame()
now acts correctly if the first argument is a vector to be recycled. (#680 thanks @jimhester)
filter.data.table()
works if the table has a variable called “V1” (#615).
*_join()
keeps columns in original order (#684). Joining a factor to a character vector doesn’t segfault (#688). *_join
functions can now deal with multiple encodings (#769), and correctly name results (#855).
*_join.data.table()
works when data.table isn’t attached (#786).
group_by()
on a data table preserves original order of the rows (#623). group_by()
supports variables with more than 39 characters thanks to a fix in lazyeval (#705). It gives meaninful error message when a variable is not found in the data frame (#716).
grouped_df()
requires vars
to be a list of symbols (#665).
min(.,na.rm = TRUE)
works with Date
s built on numeric vectors (#755)
rename_()
generic gets missing .dots
argument (#708).
row_number()
, min_rank()
, percent_rank()
, dense_rank()
, ntile()
and cume_dist()
handle data frames with 0 rows (#762). They all preserve missing values (#774). row_number()
doesn’t segfault when giving an external variable with the wrong number of variables (#781)
group_indices
handles the edge case when there are no variables (#867)
between()
vector function efficiently determines if numeric values fall in a range, and is translated to special form for SQL (#503).
count()
makes it even easier to do (weighted) counts (#358).
data_frame()
by @kevinushey is a nicer way of creating data frames. It never coerces column types (no more stringsAsFactors = FALSE
!), never munges column names, and never adds row names. You can use previously defined columns to compute new columns (#376).
distinct()
returns distinct (unique) rows of a tbl (#97). Supply additional variables to return the first row for each unique combination of variables.
Set operations, intersect()
, union()
and setdiff()
now have methods for data frames, data tables and SQL database tables (#93). They pass their arguments down to the base functions, which will ensure they raise errors if you pass in two many arguments.
Joins (e.g. left_join()
, inner_join()
, semi_join()
, anti_join()
) now allow you to join on different variables in x
and y
tables by supplying a named vector to by
. For example, by = c("a" = "b")
joins x.a
to y.b
.
n_groups()
function tells you how many groups in a tbl. It returns 1 for ungrouped data. (#477)
transmute()
works like mutate()
but drops all variables that you didn’t explicitly refer to (#302).
rename()
makes it easy to rename variables - it works similarly to select()
but it preserves columns that you didn’t otherwise touch.
slice()
allows you to selecting rows by position (#226). It includes positive integers, drops negative integers and you can use expression like n()
.
You can now program with dplyr - every function that does non-standard evaluation (NSE) has a standard evaluation (SE) version ending in _
. This is powered by the new lazyeval package which provides all the tools needed to implement NSE consistently and correctly.
See vignette("nse")
for full details.
regroup()
is deprecated. Please use the more flexible group_by_()
instead.
summarise_each_q()
and mutate_each_q()
are deprecated. Please use summarise_each_()
and mutate_each_()
instead.
funs_q
has been replaced with funs_
.
%.%
has been deprecated: please use %>%
instead. chain()
is defunct. (#518)
filter.numeric()
removed. Need to figure out how to reimplement with new lazy eval system.
The Progress
refclass is no longer exported to avoid conflicts with shiny. Instead use progress_estimated()
(#535).
src_monetdb()
is now implemented in MonetDB.R, not dplyr.
show_sql()
and explain_sql()
and matching global options dplyr.show_sql
and dplyr.explain_sql
have been removed. Instead use show_query()
and explain()
.
Main verbs now have individual documentation pages (#519).
%>%
is simply re-exported from magrittr, instead of creating a local copy (#496, thanks to @jimhester)
Examples now use nycflights13
instead of hflights
because it the variables have better names and there are a few interlinked tables (#562). Lahman
and nycflights13
are (once again) suggested packages. This means many examples will not work unless you explicitly install them with install.packages(c("Lahman", "nycflights13"))
(#508). dplyr now depends on Lahman 3.0.1. A number of examples have been updated to reflect modified field names (#586).
do()
now displays the progress bar only when used in interactive prompts and not when knitting (#428, @jimhester).
glimpse()
now prints a trailing new line (#590).
group_by()
has more consistent behaviour when grouping by constants: it creates a new column with that value (#410). It renames grouping variables (#410). The first argument is now .data
so you can create new groups with name x (#534).
Now instead of overriding lag()
, dplyr overrides lag.default()
, which should avoid clobbering lag methods added by other packages. (#277).
mutate(data, a = NULL)
removes the variable a
from the returned dataset (#462).
trunc_mat()
and hence print.tbl_df()
and friends gets a width
argument to control the deafult output width. Set options(dplyr.width = Inf)
to always show all columns (#589).
select()
gains one_of()
selector: this allows you to select variables provided by a character vector (#396). It fails immediately if you give an empty pattern to starts_with()
, ends_with()
, contains()
or matches()
(#481, @leondutoit). Fixed buglet in select()
so that you can now create variables called val
(#564).
Switched from RC to R6.
tally()
and top_n()
work consistently: neither accidentally evaluates the the wt
param. (#426, @mnel)
rename
handles grouped data (#640).
Correct SQL generation for paste()
when used with the collapse parameter targeting a Postgres database. (@rbdixon, #1357)
The db backend system has been completely overhauled in order to make it possible to add backends in other packages, and to support a much wider range of databases. See vignette("new-sql-backend")
for instruction on how to create your own (#568).
src_mysql()
gains a method for explain()
.
When mutate()
creates a new variable that uses a window function, automatically wrap the result in a subquery (#484).
order_by()
now works in conjunction with window functions in databases that support them.
tbl_df
+All verbs now understand how to work with difftime()
(#390) and AsIs
(#453) objects. They all check that colnames are unique (#483), and are more robust when columns are not present (#348, #569, #600).
Hybrid evaluation bugs fixed:
+Call substitution stopped too early when a sub expression contained a $
(#502).
Handle ::
and :::
(#412).
nth()
now correctly preserve the class when using dates, times and factors (#509).
no longer substitutes within order_by()
because order_by()
needs to do its own NSE (#169).
[.tbl_df
always returns a tbl_df (i.e. drop = FALSE
is the default) (#587, #610). [.grouped_df
preserves important output attributes (#398).
arrange()
keeps the grouping structure of grouped data (#491, #605), and preserves input classes (#563).
contains()
accidentally matched regular expressions, now it passes fixed = TRUE
to grep()
(#608).
filter()
asserts all variables are white listed (#566).
mutate()
makes a rowwise_df
when given a rowwise_df
(#463).
rbind_all()
creates tbl_df
objects instead of raw data.frame
s.
If select()
doesn’t match any variables, it returns a 0-column data frame, instead of the original (#498). It no longer fails when if some columns are not named (#492)
sample_n()
and sample_frac()
methods for data.frames exported. (#405, @alyst)
A grouped data frame may have 0 groups (#486). Grouped df objects gain some basic validity checking, which should prevent some crashes related to corrupt grouped_df
objects made by rbind()
(#606).
More coherence when joining columns of compatible but different types, e.g. when joining a character vector and a factor (#455), or a numeric and integer (#450)
mutate()
works for on zero-row grouped data frame, and with list columns (#555).
LazySubset
was confused about input data size (#452).
Internal n_distinct()
is stricter about it’s inputs: it requires one symbol which must be from the data frame (#567).
rbind_*()
handle data frames with 0 rows (#597). They fill character vector columns with NA
instead of blanks (#595). They work with list columns (#463).
Improved handling of encoding for column names (#636).
Improved handling of hybrid evaluation re $ and @ (#645).
Fix major omission in tbl_dt()
and grouped_dt()
methods - I was accidentally doing a deep copy on every result :(
summarise()
and group_by()
now retain over-allocation when working with data.tables (#475, @arunsrinivasan).
joining two data.tables now correctly dispatches to data table methods, and result is a data table (#470)
dplyr now imports %>%
from magrittr (#330). I recommend that you use this instead of %.%
because it is easier to type (since you can hold down the shift key) and is more flexible. With you %>%
, you can control which argument on the RHS recieves the LHS by using the pronoun .
. This makes %>%
more useful with base R functions because they don’t always take the data frame as the first argument. For example you could pipe mtcars
to xtabs()
with:
mtcars %>% xtabs( ~ cyl + vs, data = .)
Thanks to @smbache for the excellent magrittr package. dplyr only provides %>%
from magrittr, but it contains many other useful functions. To use them, load magrittr
explicitly: library(magrittr)
. For more details, see vignette("magrittr")
.
%.%
will be deprecated in a future version of dplyr, but it won’t happen for a while. I’ve also deprecated chain()
to encourage a single style of dplyr usage: please use %>%
instead.
do()
has been completely overhauled. There are now two ways to use it, either with multiple named arguments or a single unnamed arguments. group_by()
+ do()
is equivalent to plyr::dlply
, except it always returns a data frame.
If you use named arguments, each argument becomes a list-variable in the output. A list-variable can contain any arbitrary R object so it’s particularly well suited for storing models.
+library(dplyr)
+models <- mtcars %>% group_by(cyl) %>% do(lm = lm(mpg ~ wt, data = .))
+models %>% summarise(rsq = summary(lm)$r.squared)
If you use an unnamed argument, the result should be a data frame. This allows you to apply arbitrary functions to each group.
+ +Note the use of the .
pronoun to refer to the data in the current group.
do()
also has an automatic progress bar. It appears if the computation takes longer than 5 seconds and lets you know (approximately) how much longer the job will take to complete.
dplyr 0.2 adds three new verbs:
+glimpse()
makes it possible to see all the columns in a tbl, displaying as much data for each variable as can be fit on a single line.
sample_n()
randomly samples a fixed number of rows from a tbl; sample_frac()
randomly samples a fixed fraction of rows. Only works for local data frames and data tables (#202).
summarise_each()
and mutate_each()
make it easy to apply one or more functions to multiple columns in a tbl (#178).
If you load plyr after dplyr, you’ll get a message suggesting that you load plyr first (#347).
as.tbl_cube()
gains a method for matrices (#359, @paulstaab)
compute()
gains temporary
argument so you can control whether the results are temporary or permanent (#382, @cpsievert)
group_by()
now defaults to add = FALSE
so that it sets the grouping variables rather than adding to the existing list. I think this is how most people expected group_by
to work anyway, so it’s unlikely to cause problems (#385).
Support for MonetDB tables with src_monetdb()
(#8, thanks to @hannesmuehleisen).
New vignettes:
+memory
vignette which discusses how dplyr minimises memory usage for local data frames (#198).
new-sql-backend
vignette which discusses how to add a new SQL backend/source to dplyr.
changes()
output more clearly distinguishes which columns were added or deleted.
explain()
is now generic.
dplyr is more careful when setting the keys of data tables, so it never accidentally modifies an object that it doesn’t own. It also avoids unnecessary key setting which negatively affected performance. (#193, #255).
print()
methods for tbl_df
, tbl_dt
and tbl_sql
gain n
argument to control the number of rows printed (#362). They also works better when you have columns containing lists of complex objects.
row_number()
can be called without arguments, in which case it returns the same as 1:n()
(#303).
"comment"
attribute is allowed (white listed) as well as names (#346).
hybrid versions of min
, max
, mean
, var
, sd
and sum
handle the na.rm
argument (#168). This should yield substantial performance improvements for those functions.
Special case for call to arrange()
on a grouped data frame with no arguments. (#369)
Code adapted to Rcpp > 0.11.1
internal DataDots
class protects against missing variables in verbs (#314), including the case where ...
is missing. (#338)
all.equal.data.frame
from base is no longer bypassed. we now have all.equal.tbl_df
and all.equal.tbl_dt
methods (#332).
arrange()
correctly handles NA in numeric vectors (#331) and 0 row data frames (#289).
copy_to.src_mysql()
now works on windows (#323)
*_join()
doesn’t reorder column names (#324).
rbind_all()
is stricter and only accepts list of data frames (#288)
rbind_*
propagates time zone information for POSIXct
columns (#298).
rbind_*
is less strict about type promotion. The numeric Collecter
allows collection of integer and logical vectors. The integer Collecter
also collects logical values (#321).
internal sum
correctly handles integer (under/over)flow (#308).
summarise()
checks consistency of outputs (#300) and drops names
attribute of output columns (#357).
join functions throw error instead of crashing when there are no common variables between the data frames, and also give a better error message when only one data frame has a by variable (#371).
top_n()
returns n
rows instead of n - 1
(@leondutoit, #367).
SQL translation always evaluates subsetting operators ($
, [
, [[
) locally. (#318).
select()
now renames variables in remote sql tbls (#317) and
+implicitly adds grouping variables (#170).
internal grouped_df_impl
function errors if there are no variables to group by (#398).
n_distinct
did not treat NA correctly in the numeric case #384.
Some compiler warnings triggered by -Wall or -pedantic have been eliminated.
group_by
only creates one group for NA (#401).
Hybrid evaluator did not evaluate expression in correct environment (#403).
select()
actually renames columns in a data table (#284).
rbind_all()
and rbind_list()
now handle missing values in factors (#279).
SQL joins now work better if names duplicated in both x and y tables (#310).
Builds against Rcpp 0.11.1
select()
correctly works with the vars attribute (#309).
Internal code is stricter when deciding if a data frame is grouped (#308): this avoids a number of situations which previously causedd .
More data frame joins work with missing values in keys (#306).
select()
is substantially more powerful. You can use named arguments to rename existing variables, and new functions starts_with()
, ends_with()
, contains()
, matches()
and num_range()
to select variables based on their names. It now also makes a shallow copy, substantially reducing its memory impact (#158, #172, #192, #232).
summarize()
added as alias for summarise()
for people from countries that don’t don’t spell things correctly ;) (#245)
filter()
now fails when given anything other than a logical vector, and correctly handles missing values (#249). filter.numeric()
proxies stats::filter()
so you can continue to use filter()
function with numeric inputs (#264).
summarise()
correctly uses newly created variables (#259).
mutate()
correctly propagates attributes (#265) and mutate.data.frame()
correctly mutates the same variable repeatedly (#243).
lead()
and lag()
preserve attributes, so they now work with dates, times and factors (#166).
n()
never accepts arguments (#223).
row_number()
gives correct results (#227).
rbind_all()
silently ignores data frames with 0 rows or 0 columns (#274).
group_by()
orders the result (#242). It also checks that columns are of supported types (#233, #276).
The hybrid evaluator did not handle some expressions correctly, for example in if(n() > 5) 1 else 2
the subexpression n()
was not substituted correctly. It also correctly processes $
(#278).
arrange()
checks that all columns are of supported types (#266). It also handles list columns (#282).
Working towards Solaris compatibility.
Benchmarking vignette temporarily disabled due to microbenchmark problems reported by BDR.
new location()
and changes()
functions which provide more information about how data frames are stored in memory so that you can see what gets copied.
renamed explain_tbl()
to explain()
(#182).
tally()
gains sort
argument to sort output so highest counts come first (#173).
ungroup.grouped_df()
, tbl_df()
, as.data.frame.tbl_df()
now only make shallow copies of their inputs (#191).
The benchmark-baseball
vignette now contains fairer (including grouping times) comparisons with data.table
. (#222)
filter()
(#221) and summarise()
(#194) correctly propagate attributes.
summarise()
throws an error when asked to summarise an unknown variable instead of crashing (#208).
group_by()
handles factors with missing values (#183).
filter()
handles scalar results (#217) and better handles scoping, e.g. filter(., variable)
where variable
is defined in the function that calls filter
. It also handles T
and F
as aliases to TRUE
and FALSE
if there are no T
or F
variables in the data or in the scope.
select.grouped_df
fails when the grouping variables are not included in the selected variables (#170)
all.equal.data.frame()
handles a corner case where the data frame has NULL
names (#217)
mutate()
gives informative error message on unsupported types (#179)
dplyr source package no longer includes pandas benchmark, reducing download size from 2.8 MB to 0.5 MB.
Deprecated, use tibble::rownames_to_column()
instead.
add_rownames(df, var = "rowname")+ +
df | +Input data frame with rownames. |
+
---|---|
var | +Name of variable to use |
+
+#> # A tibble: 32 × 11 +#> mpg cyl disp hp drat wt qsec vs am gear carb +#> * <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> +#> 1 21.0 6 160.0 110 3.90 2.620 16.46 0 1 4 4 +#> 2 21.0 6 160.0 110 3.90 2.875 17.02 0 1 4 4 +#> 3 22.8 4 108.0 93 3.85 2.320 18.61 1 1 4 1 +#> 4 21.4 6 258.0 110 3.08 3.215 19.44 1 0 3 1 +#> 5 18.7 8 360.0 175 3.15 3.440 17.02 0 0 3 2 +#> 6 18.1 6 225.0 105 2.76 3.460 20.22 1 0 3 1 +#> 7 14.3 8 360.0 245 3.21 3.570 15.84 0 0 3 4 +#> 8 24.4 4 146.7 62 3.69 3.190 20.00 1 0 4 2 +#> 9 22.8 4 140.8 95 3.92 3.150 22.90 1 0 4 2 +#> 10 19.2 6 167.6 123 3.92 3.440 18.30 1 0 4 4 +#> # ... with 22 more rows+mtcars %>% add_rownames()#> Warning: Deprecated, use tibble::rownames_to_column() instead.#> # A tibble: 32 × 12 +#> rowname mpg cyl disp hp drat wt qsec vs am +#> <chr> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> +#> 1 Mazda RX4 21.0 6 160.0 110 3.90 2.620 16.46 0 1 +#> 2 Mazda RX4 Wag 21.0 6 160.0 110 3.90 2.875 17.02 0 1 +#> 3 Datsun 710 22.8 4 108.0 93 3.85 2.320 18.61 1 1 +#> 4 Hornet 4 Drive 21.4 6 258.0 110 3.08 3.215 19.44 1 0 +#> 5 Hornet Sportabout 18.7 8 360.0 175 3.15 3.440 17.02 0 0 +#> 6 Valiant 18.1 6 225.0 105 2.76 3.460 20.22 1 0 +#> 7 Duster 360 14.3 8 360.0 245 3.21 3.570 15.84 0 0 +#> 8 Merc 240D 24.4 4 146.7 62 3.69 3.190 20.00 1 0 +#> 9 Merc 230 22.8 4 140.8 95 3.92 3.150 22.90 1 0 +#> 10 Merc 280 19.2 6 167.6 123 3.92 3.440 18.30 1 0 +#> # ... with 22 more rows, and 2 more variables: gear <dbl>, carb <dbl>
You can use all_equal()
with any data frame, and dplyr also provides
+tbl_df
methods for all.equal()
.
all_equal(target, current, ignore_col_order = TRUE, ignore_row_order = TRUE, + convert = FALSE, ...) + +# S3 method for tbl_df +all.equal(target, current, ignore_col_order = TRUE, + ignore_row_order = TRUE, convert = FALSE, ...)+ +
target, current | +Two data frames to compare. |
+
---|---|
ignore_col_order | +Should order of columns be ignored? |
+
ignore_row_order | +Should order of rows be ignored? |
+
convert | +Should similar classes be converted? Currently this will +convert factor to character and integer to double. |
+
... | +Ignored. Needed for compatibility with |
+
TRUE
if equal, otherwise a character vector describing
+the reasons why they're not equal. Use isTRUE()
if using the
+result in an if
expression.
+scramble <- function(x) x[sample(nrow(x)), sample(ncol(x))] + +# By default, ordering of rows and columns ignored +all_equal(mtcars, scramble(mtcars))#> [1] TRUE+# But those can be overriden if desired +all_equal(mtcars, scramble(mtcars), ignore_col_order = FALSE)#> [1] "Same column names, but different order"all_equal(mtcars, scramble(mtcars), ignore_row_order = FALSE)#> [1] "Same row values, but different order"+# By default all_equal is sensitive to variable differences +df1 <- data.frame(x = "a") +df2 <- data.frame(x = factor("a")) +all_equal(df1, df2)#> [1] TRUE# But you can request dplyr convert similar types +all_equal(df1, df2, convert = TRUE)#> [1] TRUE
These quoting functions signal to scoped filtering verbs
+(e.g. filter_if()
or filter_all()
) that a predicate expression
+should be applied to all relevant variables. The all_vars()
+variant takes the intersection of the predicate expressions with
+&
while the any_vars()
variant takes the union with |
.
all_vars(expr) + +any_vars(expr)+ +
expr | +A predicate expression. This variable supports +unquoting and will be evaluated in the +context of the data frame. It should return a logical vector. +This argument is automatically quoted and later
+evaluated in the context of the data
+frame. It supports unquoting. See
+ |
+
---|
funs()
and vars()
for other quoting functions that you
+can use with scoped verbs.
Use desc()
to sort a variable in descending order.
arrange(.data, ...) + +# S3 method for grouped_df +arrange(.data, ..., .by_group = FALSE)+ +
.data | +A tbl. All main verbs are S3 generics and provide methods
+for |
+
---|---|
... | +Comma separated list of unquoted variable names. Use
+ |
+
.by_group | +If |
+
An object of the same class as .data
.
The sort order for character vectors will depend on the collating sequence
+of the locale in use: see locales()
.
When applied to a data frame, row names are silently dropped. To preserve,
+convert to an explicit variable with tibble::rownames_to_column()
.
Other single table verbs: filter
,
+ mutate
, select
,
+ slice
, summarise
+arrange(mtcars, cyl, disp)#> mpg cyl disp hp drat wt qsec vs am gear carb +#> 1 33.9 4 71.1 65 4.22 1.835 19.90 1 1 4 1 +#> 2 30.4 4 75.7 52 4.93 1.615 18.52 1 1 4 2 +#> 3 32.4 4 78.7 66 4.08 2.200 19.47 1 1 4 1 +#> 4 27.3 4 79.0 66 4.08 1.935 18.90 1 1 4 1 +#> 5 30.4 4 95.1 113 3.77 1.513 16.90 1 1 5 2 +#> 6 22.8 4 108.0 93 3.85 2.320 18.61 1 1 4 1 +#> 7 21.5 4 120.1 97 3.70 2.465 20.01 1 0 3 1 +#> 8 26.0 4 120.3 91 4.43 2.140 16.70 0 1 5 2 +#> 9 21.4 4 121.0 109 4.11 2.780 18.60 1 1 4 2 +#> 10 22.8 4 140.8 95 3.92 3.150 22.90 1 0 4 2 +#> 11 24.4 4 146.7 62 3.69 3.190 20.00 1 0 4 2 +#> 12 19.7 6 145.0 175 3.62 2.770 15.50 0 1 5 6 +#> 13 21.0 6 160.0 110 3.90 2.620 16.46 0 1 4 4 +#> 14 21.0 6 160.0 110 3.90 2.875 17.02 0 1 4 4 +#> 15 19.2 6 167.6 123 3.92 3.440 18.30 1 0 4 4 +#> 16 17.8 6 167.6 123 3.92 3.440 18.90 1 0 4 4 +#> 17 18.1 6 225.0 105 2.76 3.460 20.22 1 0 3 1 +#> 18 21.4 6 258.0 110 3.08 3.215 19.44 1 0 3 1 +#> 19 16.4 8 275.8 180 3.07 4.070 17.40 0 0 3 3 +#> 20 17.3 8 275.8 180 3.07 3.730 17.60 0 0 3 3 +#> 21 15.2 8 275.8 180 3.07 3.780 18.00 0 0 3 3 +#> 22 15.0 8 301.0 335 3.54 3.570 14.60 0 1 5 8 +#> 23 15.2 8 304.0 150 3.15 3.435 17.30 0 0 3 2 +#> 24 15.5 8 318.0 150 2.76 3.520 16.87 0 0 3 2 +#> 25 13.3 8 350.0 245 3.73 3.840 15.41 0 0 3 4 +#> 26 15.8 8 351.0 264 4.22 3.170 14.50 0 1 5 4 +#> 27 18.7 8 360.0 175 3.15 3.440 17.02 0 0 3 2 +#> 28 14.3 8 360.0 245 3.21 3.570 15.84 0 0 3 4 +#> 29 19.2 8 400.0 175 3.08 3.845 17.05 0 0 3 2 +#> 30 14.7 8 440.0 230 3.23 5.345 17.42 0 0 3 4 +#> 31 10.4 8 460.0 215 3.00 5.424 17.82 0 0 3 4 +#> 32 10.4 8 472.0 205 2.93 5.250 17.98 0 0 3 4#> mpg cyl disp hp drat wt qsec vs am gear carb +#> 1 10.4 8 472.0 205 2.93 5.250 17.98 0 0 3 4 +#> 2 10.4 8 460.0 215 3.00 5.424 17.82 0 0 3 4 +#> 3 14.7 8 440.0 230 3.23 5.345 17.42 0 0 3 4 +#> 4 19.2 8 400.0 175 3.08 3.845 17.05 0 0 3 2 +#> 5 18.7 8 360.0 175 3.15 3.440 17.02 0 0 3 2 +#> 6 14.3 8 360.0 245 3.21 3.570 15.84 0 0 3 4 +#> 7 15.8 8 351.0 264 4.22 3.170 14.50 0 1 5 4 +#> 8 13.3 8 350.0 245 3.73 3.840 15.41 0 0 3 4 +#> 9 15.5 8 318.0 150 2.76 3.520 16.87 0 0 3 2 +#> 10 15.2 8 304.0 150 3.15 3.435 17.30 0 0 3 2 +#> 11 15.0 8 301.0 335 3.54 3.570 14.60 0 1 5 8 +#> 12 16.4 8 275.8 180 3.07 4.070 17.40 0 0 3 3 +#> 13 17.3 8 275.8 180 3.07 3.730 17.60 0 0 3 3 +#> 14 15.2 8 275.8 180 3.07 3.780 18.00 0 0 3 3 +#> 15 21.4 6 258.0 110 3.08 3.215 19.44 1 0 3 1 +#> 16 18.1 6 225.0 105 2.76 3.460 20.22 1 0 3 1 +#> 17 19.2 6 167.6 123 3.92 3.440 18.30 1 0 4 4 +#> 18 17.8 6 167.6 123 3.92 3.440 18.90 1 0 4 4 +#> 19 21.0 6 160.0 110 3.90 2.620 16.46 0 1 4 4 +#> 20 21.0 6 160.0 110 3.90 2.875 17.02 0 1 4 4 +#> 21 24.4 4 146.7 62 3.69 3.190 20.00 1 0 4 2 +#> 22 19.7 6 145.0 175 3.62 2.770 15.50 0 1 5 6 +#> 23 22.8 4 140.8 95 3.92 3.150 22.90 1 0 4 2 +#> 24 21.4 4 121.0 109 4.11 2.780 18.60 1 1 4 2 +#> 25 26.0 4 120.3 91 4.43 2.140 16.70 0 1 5 2 +#> 26 21.5 4 120.1 97 3.70 2.465 20.01 1 0 3 1 +#> 27 22.8 4 108.0 93 3.85 2.320 18.61 1 1 4 1 +#> 28 30.4 4 95.1 113 3.77 1.513 16.90 1 1 5 2 +#> 29 27.3 4 79.0 66 4.08 1.935 18.90 1 1 4 1 +#> 30 32.4 4 78.7 66 4.08 2.200 19.47 1 1 4 1 +#> 31 30.4 4 75.7 52 4.93 1.615 18.52 1 1 4 2 +#> 32 33.9 4 71.1 65 4.22 1.835 19.90 1 1 4 1#> Source: local data frame [32 x 11] +#> Groups: cyl [3] +#> +#> mpg cyl disp hp drat wt qsec vs am gear carb +#> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> +#> 1 10.4 8 460.0 215 3.00 5.424 17.82 0 0 3 4 +#> 2 14.7 8 440.0 230 3.23 5.345 17.42 0 0 3 4 +#> 3 10.4 8 472.0 205 2.93 5.250 17.98 0 0 3 4 +#> 4 16.4 8 275.8 180 3.07 4.070 17.40 0 0 3 3 +#> 5 19.2 8 400.0 175 3.08 3.845 17.05 0 0 3 2 +#> 6 13.3 8 350.0 245 3.73 3.840 15.41 0 0 3 4 +#> 7 15.2 8 275.8 180 3.07 3.780 18.00 0 0 3 3 +#> 8 17.3 8 275.8 180 3.07 3.730 17.60 0 0 3 3 +#> 9 14.3 8 360.0 245 3.21 3.570 15.84 0 0 3 4 +#> 10 15.0 8 301.0 335 3.54 3.570 14.60 0 1 5 8 +#> # ... with 22 more rows#> Source: local data frame [32 x 11] +#> Groups: cyl [3] +#> +#> mpg cyl disp hp drat wt qsec vs am gear carb +#> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> +#> 1 24.4 4 146.7 62 3.69 3.190 20.00 1 0 4 2 +#> 2 22.8 4 140.8 95 3.92 3.150 22.90 1 0 4 2 +#> 3 21.4 4 121.0 109 4.11 2.780 18.60 1 1 4 2 +#> 4 21.5 4 120.1 97 3.70 2.465 20.01 1 0 3 1 +#> 5 22.8 4 108.0 93 3.85 2.320 18.61 1 1 4 1 +#> 6 32.4 4 78.7 66 4.08 2.200 19.47 1 1 4 1 +#> 7 26.0 4 120.3 91 4.43 2.140 16.70 0 1 5 2 +#> 8 27.3 4 79.0 66 4.08 1.935 18.90 1 1 4 1 +#> 9 33.9 4 71.1 65 4.22 1.835 19.90 1 1 4 1 +#> 10 30.4 4 75.7 52 4.93 1.615 18.52 1 1 4 2 +#> # ... with 22 more rows
tbl_cube
to other data structures — as.table.tbl_cube • dplyrtbl_cube
to other data structuresSupports conversion to tables, data frames, tibbles.
+For a cube, the data frame returned by
+tibble::as_data_frame()
resulting data frame contains the
+dimensions as character values (and not as factors).
# S3 method for tbl_cube +as.table(x, ..., measure = 1L) + +# S3 method for tbl_cube +as.data.frame(x, ...) + +# S3 method for tbl_cube +as_data_frame(x, ...)+ +
x | +a |
+
---|---|
... | +Passed on to individual methods; otherwise ignored. |
+
measure | +A measure name or index, default: the first measure |
+
tbl_cube
— as.tbl_cube • dplyrtbl_cube
Coerce an existing data structure into a tbl_cube
as.tbl_cube(x, ...) + +# S3 method for array +as.tbl_cube(x, dim_names = names(dimnames(x)), + met_name = deparse(substitute(x)), ...) + +# S3 method for table +as.tbl_cube(x, dim_names = names(dimnames(x)), + met_name = "Freq", ...) + +# S3 method for matrix +as.tbl_cube(x, dim_names = names(dimnames(x)), + met_name = deparse(substitute(x)), ...) + +# S3 method for data.frame +as.tbl_cube(x, dim_names = NULL, + met_name = guess_met(x), ...)+ +
x | +an object to convert. Built in methods will convert arrays, +tables and data frames. |
+
---|---|
... | +Passed on to individual methods; otherwise ignored. |
+
dim_names | +names of the dimesions. Defaults to the names of |
+
met_name | +a string to use as the name for the measure
+the |
+
Copy tables to same source, if necessary.
+ + +auto_copy(x, y, copy = FALSE, ...)+ +
x, y | +
|
+
---|---|
copy | +If |
+
... | +Other arguments passed on to methods. |
+
The sql_
generics are used to build the different types of SQL queries.
+The default implementations in dbplyr generates ANSI 92 compliant SQL.
+The db_
generics execute actions on the database. The default
+implementations in dbplyr typically just call the standard DBI S4
+method.
db_desc(x) + +sql_translate_env(con) + +db_list_tables(con) + +db_has_table(con, table) + +db_data_type(con, fields) + +db_save_query(con, sql, name, temporary = TRUE, ...) + +db_begin(con, ...) + +db_commit(con, ...) + +db_rollback(con, ...) + +db_write_table(con, table, types, values, temporary = FALSE, ...) + +db_create_table(con, table, types, temporary = FALSE, ...) + +db_insert_into(con, table, values, ...) + +db_create_indexes(con, table, indexes = NULL, unique = FALSE, ...) + +db_create_index(con, table, columns, name = NULL, unique = FALSE, ...) + +db_drop_table(con, table, force = FALSE, ...) + +db_analyze(con, table, ...) + +db_explain(con, sql, ...) + +db_query_fields(con, sql, ...) + +db_query_rows(con, sql, ...) + +sql_select(con, select, from, where = NULL, group_by = NULL, + having = NULL, order_by = NULL, limit = NULL, distinct = FALSE, ...) + +sql_subquery(con, from, name = random_table_name(), ...) + +sql_join(con, x, y, vars, type = "inner", by = NULL, ...) + +sql_semi_join(con, x, y, anti = FALSE, by = NULL, ...) + +sql_set_op(con, x, y, method) + +sql_escape_string(con, x) + +sql_escape_ident(con, x)+ +
con | +A database connection. |
+
---|---|
table | +A string, the table name. |
+
fields | +A list of fields, as in a data frame. |
+
Usually a logical value indicating success. Most failures should generate
+an error. However, db_has_table()
should return NA
if
+temporary tables cannot be listed with DBI::dbListTables()
(due to backend
+API limitations for example). As a result, you methods will rely on the
+backend to throw an error if a table exists when it shouldn't.
A few backend methods do not call the standard DBI S4 methods including
db_data_type()
: Calls DBI::dbDataType()
for every field
+(e.g. data frame column) and returns a vector of corresponding SQL data
+types
db_save_query()
: Builds and executes a
+CREATE [TEMPORARY] TABLE <table> ...
SQL command.
db_create_index()
: Builds and executes a
+CREATE INDEX <name> ON <table>
SQL command.
db_drop_table()
: Builds and executes a
+DROP TABLE [IF EXISTS] <table>
SQL command.
db_analyze()
: Builds and executes an
+ANALYZE <table>
SQL command.
Currently, copy_to()
is the only user of db_begin()
, db_commit()
,
+db_rollback()
, db_write_table()
, db_create_indexes()
, db_drop_table()
and
+db_analyze()
. If you find yourself overriding many of these
+functions it may suggest that you should just override copy_to()
+instead.
+ db_create_table()
and db_insert_into()
have been deprecated
+in favour of db_write_table()
.
These data sets describe band members of the Beatles and Rolling Stones. They +are toy data sets that can be displayed in their entirety on a slide (e.g. to +demonstrate a join).
+ + +band_members + +band_instruments + +band_instruments2+ +
Each is a tibble with two variables and three observations
+ +band_instruments
and band_instruments2
contain the same data but use
+different column names for the first column of the data set.
+band_instruments
uses name
, which matches the name of the key column of
+band_members
; band_instruments2
uses artist
, which does not.
+band_members#> # A tibble: 3 × 2 +#> name band +#> <chr> <chr> +#> 1 Mick Stones +#> 2 John Beatles +#> 3 Paul Beatlesband_instruments#> # A tibble: 3 × 2 +#> name plays +#> <chr> <chr> +#> 1 John guitar +#> 2 Paul bass +#> 3 Keith guitarband_instruments2#> # A tibble: 3 × 2 +#> artist plays +#> <chr> <chr> +#> 1 John guitar +#> 2 Paul bass +#> 3 Keith guitar
These functions support the comparison of results and timings across +multiple sources.
+ + +bench_tbls(tbls, op, ..., times = 10) + +compare_tbls(tbls, op, ref = NULL, compare = equal_data_frame, ...) + +compare_tbls2(tbls_x, tbls_y, op, ref = NULL, compare = equal_data_frame, + ...) + +eval_tbls(tbls, op) + +eval_tbls2(tbls_x, tbls_y, op)+ +
tbls, tbls_x, tbls_y | +A list of |
+
---|---|
op | +A function with a single argument, called often with each
+element of |
+
… | +For For |
+
times | +For benchmarking, the number of times each operation is +repeated. |
+
ref | +For checking, an data frame to test results against. If not
+supplied, defaults to the results from the first |
+
compare | +A function used to compare the results. Defaults to
+ |
+
eval_tbls()
: a list of data frames.
+
+compare_tbls()
: an invisible TRUE
on success, otherwise
+an error is thrown.
+
+bench_tbls()
: an object of class
+microbenchmark::microbenchmark()
src_local()
for working with local data
+## Not run: ------------------------------------ +# if (require("microbenchmark") && has_lahman()) { +# lahman_local <- lahman_srcs("df", "sqlite") +# teams <- lapply(lahman_local, function(x) x %>% tbl("Teams")) +# +# compare_tbls(teams, function(x) x %>% filter(yearID == 2010)) +# bench_tbls(teams, function(x) x %>% filter(yearID == 2010)) +# +# # You can also supply arbitrary additional arguments to bench_tbls +# # if there are other operations you'd like to compare. +# bench_tbls(teams, function(x) x %>% filter(yearID == 2010), +# base = subset(Lahman::Teams, yearID == 2010)) +# +# # A more complicated example using multiple tables +# setup <- function(src) { +# list( +# src %>% tbl("Batting") %>% filter(stint == 1) %>% select(playerID:H), +# src %>% tbl("Master") %>% select(playerID, birthYear) +# ) +# } +# two_tables <- lapply(lahman_local, setup) +# +# op <- function(tbls) { +# semi_join(tbls[[1]], tbls[[2]], by = "playerID") +# } +# # compare_tbls(two_tables, op) +# bench_tbls(two_tables, op, times = 2) +# +# } +## ---------------------------------------------
This is a shortcut for x >= left & x <= right
, implemented
+efficiently in C++ for local values, and translated to the
+appropriate SQL for remote tables.
between(x, left, right)+ +
x | +A numeric vector of values |
+
---|---|
left, right | +Boundary values |
+
+x <- rnorm(1e2) +x[between(x, -1, 1)]#> [1] -0.86072428 0.42123042 0.19439244 -0.69120544 -0.94410166 -0.71605867 +#> [7] 0.91107847 -0.77219209 -0.78207767 -0.43219524 -0.66756477 0.91187392 +#> [13] 0.20538939 -0.78938814 0.58807712 -0.71128732 0.67638957 -0.23276176 +#> [19] 0.63747287 -0.68326687 -0.97967535 -0.46251911 0.74786883 -0.80534353 +#> [25] 0.77599004 0.70359786 0.71540139 0.40152349 0.40427794 -0.77705556 +#> [31] -0.28045548 0.29738725 -0.23564615 0.04433469 -0.32849189 0.46205231 +#> [37] 0.69362435 -0.70859443 -0.20889688 0.35227917 -0.77928540 0.70005531 +#> [43] 0.11759261 -0.28362275 0.49790884 0.38624909 0.71752478 0.13191018 +#> [49] -0.92066340 0.26726762 -0.23854626 -0.78447669 -0.82776894 0.94433756 +#> [55] -0.63969296 -0.21714460 0.57991478 -0.95260348 -0.96767371 0.79245114 +#> [61] -0.93697260 0.86130054
This is an efficient implementation of the common pattern of
+do.call(rbind, dfs)
or do.call(cbind, dfs)
for binding many
+data frames into one. combine()
acts like c()
or
+unlist()
but uses consistent dplyr coercion rules.
bind_rows(..., .id = NULL) + +bind_cols(...) + +combine(...)+ +
... | +Data frames to combine. +Each argument can either be a data frame, a list that could be a data +frame, or a list of data frames. +When row-binding, columns are matched by name, and any missing +columns with be filled with NA. +When column-binding, rows are matched by position, so all data +frames must have the same number of rows. To match by value, not +position, see join. |
+
---|---|
.id | +Data frame identifier. +When |
+
bind_rows()
and bind_cols()
return the same type as
+the first input, either a data frame, tbl_df
, or grouped_df
.
The output of bind_rows()
will contain a column if that column
+appears in any of the inputs.
rbind_list()
and rbind_all()
have been deprecated. Instead use
+bind_rows()
.
+one <- mtcars[1:4, ] +two <- mtcars[11:14, ] + +# You can either supply data frames as arguments +bind_rows(one, two)#> mpg cyl disp hp drat wt qsec vs am gear carb +#> 1 21.0 6 160.0 110 3.90 2.620 16.46 0 1 4 4 +#> 2 21.0 6 160.0 110 3.90 2.875 17.02 0 1 4 4 +#> 3 22.8 4 108.0 93 3.85 2.320 18.61 1 1 4 1 +#> 4 21.4 6 258.0 110 3.08 3.215 19.44 1 0 3 1 +#> 5 17.8 6 167.6 123 3.92 3.440 18.90 1 0 4 4 +#> 6 16.4 8 275.8 180 3.07 4.070 17.40 0 0 3 3 +#> 7 17.3 8 275.8 180 3.07 3.730 17.60 0 0 3 3 +#> 8 15.2 8 275.8 180 3.07 3.780 18.00 0 0 3 3# Or a single argument containing a list of data frames +bind_rows(list(one, two))#> mpg cyl disp hp drat wt qsec vs am gear carb +#> 1 21.0 6 160.0 110 3.90 2.620 16.46 0 1 4 4 +#> 2 21.0 6 160.0 110 3.90 2.875 17.02 0 1 4 4 +#> 3 22.8 4 108.0 93 3.85 2.320 18.61 1 1 4 1 +#> 4 21.4 6 258.0 110 3.08 3.215 19.44 1 0 3 1 +#> 5 17.8 6 167.6 123 3.92 3.440 18.90 1 0 4 4 +#> 6 16.4 8 275.8 180 3.07 4.070 17.40 0 0 3 3 +#> 7 17.3 8 275.8 180 3.07 3.730 17.60 0 0 3 3 +#> 8 15.2 8 275.8 180 3.07 3.780 18.00 0 0 3 3bind_rows(split(mtcars, mtcars$cyl))#> mpg cyl disp hp drat wt qsec vs am gear carb +#> 1 22.8 4 108.0 93 3.85 2.320 18.61 1 1 4 1 +#> 2 24.4 4 146.7 62 3.69 3.190 20.00 1 0 4 2 +#> 3 22.8 4 140.8 95 3.92 3.150 22.90 1 0 4 2 +#> 4 32.4 4 78.7 66 4.08 2.200 19.47 1 1 4 1 +#> 5 30.4 4 75.7 52 4.93 1.615 18.52 1 1 4 2 +#> 6 33.9 4 71.1 65 4.22 1.835 19.90 1 1 4 1 +#> 7 21.5 4 120.1 97 3.70 2.465 20.01 1 0 3 1 +#> 8 27.3 4 79.0 66 4.08 1.935 18.90 1 1 4 1 +#> 9 26.0 4 120.3 91 4.43 2.140 16.70 0 1 5 2 +#> 10 30.4 4 95.1 113 3.77 1.513 16.90 1 1 5 2 +#> 11 21.4 4 121.0 109 4.11 2.780 18.60 1 1 4 2 +#> 12 21.0 6 160.0 110 3.90 2.620 16.46 0 1 4 4 +#> 13 21.0 6 160.0 110 3.90 2.875 17.02 0 1 4 4 +#> 14 21.4 6 258.0 110 3.08 3.215 19.44 1 0 3 1 +#> 15 18.1 6 225.0 105 2.76 3.460 20.22 1 0 3 1 +#> 16 19.2 6 167.6 123 3.92 3.440 18.30 1 0 4 4 +#> 17 17.8 6 167.6 123 3.92 3.440 18.90 1 0 4 4 +#> 18 19.7 6 145.0 175 3.62 2.770 15.50 0 1 5 6 +#> 19 18.7 8 360.0 175 3.15 3.440 17.02 0 0 3 2 +#> 20 14.3 8 360.0 245 3.21 3.570 15.84 0 0 3 4 +#> 21 16.4 8 275.8 180 3.07 4.070 17.40 0 0 3 3 +#> 22 17.3 8 275.8 180 3.07 3.730 17.60 0 0 3 3 +#> 23 15.2 8 275.8 180 3.07 3.780 18.00 0 0 3 3 +#> 24 10.4 8 472.0 205 2.93 5.250 17.98 0 0 3 4 +#> 25 10.4 8 460.0 215 3.00 5.424 17.82 0 0 3 4 +#> 26 14.7 8 440.0 230 3.23 5.345 17.42 0 0 3 4 +#> 27 15.5 8 318.0 150 2.76 3.520 16.87 0 0 3 2 +#> 28 15.2 8 304.0 150 3.15 3.435 17.30 0 0 3 2 +#> 29 13.3 8 350.0 245 3.73 3.840 15.41 0 0 3 4 +#> 30 19.2 8 400.0 175 3.08 3.845 17.05 0 0 3 2 +#> 31 15.8 8 351.0 264 4.22 3.170 14.50 0 1 5 4 +#> 32 15.0 8 301.0 335 3.54 3.570 14.60 0 1 5 8+# When you supply a column name with the `.id` argument, a new +# column is created to link each row to its original data frame +bind_rows(list(one, two), .id = "id")#> id mpg cyl disp hp drat wt qsec vs am gear carb +#> 1 1 21.0 6 160.0 110 3.90 2.620 16.46 0 1 4 4 +#> 2 1 21.0 6 160.0 110 3.90 2.875 17.02 0 1 4 4 +#> 3 1 22.8 4 108.0 93 3.85 2.320 18.61 1 1 4 1 +#> 4 1 21.4 6 258.0 110 3.08 3.215 19.44 1 0 3 1 +#> 5 2 17.8 6 167.6 123 3.92 3.440 18.90 1 0 4 4 +#> 6 2 16.4 8 275.8 180 3.07 4.070 17.40 0 0 3 3 +#> 7 2 17.3 8 275.8 180 3.07 3.730 17.60 0 0 3 3 +#> 8 2 15.2 8 275.8 180 3.07 3.780 18.00 0 0 3 3bind_rows(list(a = one, b = two), .id = "id")#> id mpg cyl disp hp drat wt qsec vs am gear carb +#> 1 a 21.0 6 160.0 110 3.90 2.620 16.46 0 1 4 4 +#> 2 a 21.0 6 160.0 110 3.90 2.875 17.02 0 1 4 4 +#> 3 a 22.8 4 108.0 93 3.85 2.320 18.61 1 1 4 1 +#> 4 a 21.4 6 258.0 110 3.08 3.215 19.44 1 0 3 1 +#> 5 b 17.8 6 167.6 123 3.92 3.440 18.90 1 0 4 4 +#> 6 b 16.4 8 275.8 180 3.07 4.070 17.40 0 0 3 3 +#> 7 b 17.3 8 275.8 180 3.07 3.730 17.60 0 0 3 3 +#> 8 b 15.2 8 275.8 180 3.07 3.780 18.00 0 0 3 3bind_rows("group 1" = one, "group 2" = two, .id = "groups")#> groups mpg cyl disp hp drat wt qsec vs am gear carb +#> 1 group 1 21.0 6 160.0 110 3.90 2.620 16.46 0 1 4 4 +#> 2 group 1 21.0 6 160.0 110 3.90 2.875 17.02 0 1 4 4 +#> 3 group 1 22.8 4 108.0 93 3.85 2.320 18.61 1 1 4 1 +#> 4 group 1 21.4 6 258.0 110 3.08 3.215 19.44 1 0 3 1 +#> 5 group 2 17.8 6 167.6 123 3.92 3.440 18.90 1 0 4 4 +#> 6 group 2 16.4 8 275.8 180 3.07 4.070 17.40 0 0 3 3 +#> 7 group 2 17.3 8 275.8 180 3.07 3.730 17.60 0 0 3 3 +#> 8 group 2 15.2 8 275.8 180 3.07 3.780 18.00 0 0 3 3+# Columns don't need to match when row-binding +bind_rows(data.frame(x = 1:3), data.frame(y = 1:4))#> x y +#> 1 1 NA +#> 2 2 NA +#> 3 3 NA +#> 4 NA 1 +#> 5 NA 2 +#> 6 NA 3 +#> 7 NA 4## Not run: ------------------------------------ +# # Rows do need to match when column-binding +# bind_cols(data.frame(x = 1), data.frame(y = 1:2)) +## --------------------------------------------- + +bind_cols(one, two)#> mpg cyl disp hp drat wt qsec vs am gear carb mpg1 cyl1 disp1 hp1 drat1 +#> 1 21.0 6 160 110 3.90 2.620 16.46 0 1 4 4 17.8 6 167.6 123 3.92 +#> 2 21.0 6 160 110 3.90 2.875 17.02 0 1 4 4 16.4 8 275.8 180 3.07 +#> 3 22.8 4 108 93 3.85 2.320 18.61 1 1 4 1 17.3 8 275.8 180 3.07 +#> 4 21.4 6 258 110 3.08 3.215 19.44 1 0 3 1 15.2 8 275.8 180 3.07 +#> wt1 qsec1 vs1 am1 gear1 carb1 +#> 1 3.44 18.9 1 0 4 4 +#> 2 4.07 17.4 0 0 3 3 +#> 3 3.73 17.6 0 0 3 3 +#> 4 3.78 18.0 0 0 3 3bind_cols(list(one, two))#> mpg cyl disp hp drat wt qsec vs am gear carb mpg1 cyl1 disp1 hp1 drat1 +#> 1 21.0 6 160 110 3.90 2.620 16.46 0 1 4 4 17.8 6 167.6 123 3.92 +#> 2 21.0 6 160 110 3.90 2.875 17.02 0 1 4 4 16.4 8 275.8 180 3.07 +#> 3 22.8 4 108 93 3.85 2.320 18.61 1 1 4 1 17.3 8 275.8 180 3.07 +#> 4 21.4 6 258 110 3.08 3.215 19.44 1 0 3 1 15.2 8 275.8 180 3.07 +#> wt1 qsec1 vs1 am1 gear1 carb1 +#> 1 3.44 18.9 1 0 4 4 +#> 2 4.07 17.4 0 0 3 3 +#> 3 3.73 17.6 0 0 3 3 +#> 4 3.78 18.0 0 0 3 3+# combine applies the same coercion rules +f1 <- factor("a") +f2 <- factor("b") +c(f1, f2)#> [1] 1 1unlist(list(f1, f2))#> [1] a b +#> Levels: a b+combine(f1, f2)#> Warning: Unequal factor levels: coercing to character#> Warning: binding character and factor vector, coercing into character vector#> Warning: binding character and factor vector, coercing into character vector#> [1] "a" "b"combine(list(f1, f2))#> Warning: Unequal factor levels: coercing to character#> Warning: binding character and factor vector, coercing into character vector#> Warning: binding character and factor vector, coercing into character vector#> [1] "a" "b"
This function allows you to vectorise multiple if
and else if
+statements. It is an R equivalent of the SQL CASE WHEN
statement.
case_when(...)+ +
... | +A sequence of two-sided formulas. The left hand side (LHS) +determines which values match this case. The right hand side (RHS) +provides the replacement value. +The LHS must evaluate to a logical vector. Each logical vector can +either have length 1 or a common length. All RHSs must evaluate to +the same type of vector. +These dots are evaluated with explicit splicing. |
+
---|
A vector as long as the longest LHS, with the type (and +attributes) of the first RHS. Inconsistent lengths or types will +generate an error.
+ + ++x <- 1:50 +case_when( + x %% 35 == 0 ~ "fizz buzz", + x %% 5 == 0 ~ "fizz", + x %% 7 == 0 ~ "buzz", + TRUE ~ as.character(x) +)#> [1] "1" "2" "3" "4" "fizz" "6" +#> [7] "buzz" "8" "9" "fizz" "11" "12" +#> [13] "13" "buzz" "fizz" "16" "17" "18" +#> [19] "19" "fizz" "buzz" "22" "23" "24" +#> [25] "fizz" "26" "27" "buzz" "29" "fizz" +#> [31] "31" "32" "33" "34" "fizz buzz" "36" +#> [37] "37" "38" "39" "fizz" "41" "buzz" +#> [43] "43" "44" "fizz" "46" "47" "48" +#> [49] "buzz" "fizz"+# Like an if statement, the arguments are evaluated in order, so you must +# proceed from the most specific to the most general. This won't work: +case_when( + TRUE ~ as.character(x), + x %% 5 == 0 ~ "fizz", + x %% 7 == 0 ~ "buzz", + x %% 35 == 0 ~ "fizz buzz" +)#> [1] "1" "2" "3" "4" "5" "6" "7" "8" "9" "10" "11" "12" "13" "14" "15" +#> [16] "16" "17" "18" "19" "20" "21" "22" "23" "24" "25" "26" "27" "28" "29" "30" +#> [31] "31" "32" "33" "34" "35" "36" "37" "38" "39" "40" "41" "42" "43" "44" "45" +#> [46] "46" "47" "48" "49" "50"+# case_when is particularly useful inside mutate when you want to +# create a new variable that relies on a complex combination of existing +# variables +starwars %>% + select(name:mass, gender, species) %>% + mutate( + type = case_when( + height > 200 | mass > 200 ~ "large", + species == "Droid" ~ "robot", + TRUE ~ "other" + ) + )#> # A tibble: 87 × 6 +#> name height mass gender species type +#> <chr> <int> <dbl> <chr> <chr> <chr> +#> 1 Luke Skywalker 172 77 male Human other +#> 2 C-3PO 167 75 <NA> Droid robot +#> 3 R2-D2 96 32 <NA> Droid robot +#> 4 Darth Vader 202 136 male Human large +#> 5 Leia Organa 150 49 female Human other +#> 6 Owen Lars 178 120 male Human other +#> 7 Beru Whitesun lars 165 75 female Human other +#> 8 R5-D4 97 32 <NA> Droid robot +#> 9 Biggs Darklighter 183 84 male Human other +#> 10 Obi-Wan Kenobi 182 77 male Human other +#> # ... with 77 more rows+# Dots support splicing: +patterns <- list( + TRUE ~ as.character(x), + x %% 5 == 0 ~ "fizz", + x %% 7 == 0 ~ "buzz", + x %% 35 == 0 ~ "fizz buzz" +) +case_when(!!! patterns)#> [1] "1" "2" "3" "4" "5" "6" "7" "8" "9" "10" "11" "12" "13" "14" "15" +#> [16] "16" "17" "18" "19" "20" "21" "22" "23" "24" "25" "26" "27" "28" "29" "30" +#> [31] "31" "32" "33" "34" "35" "36" "37" "38" "39" "40" "41" "42" "43" "44" "45" +#> [46] "46" "47" "48" "49" "50"
Given a set of vectors, coalesce()
finds the first non-missing value
+at each position. This is inspired by the SQL COALESCE
function
+which does the same thing for NULL
s.
coalesce(...)+ +
... | +Vectors. All inputs should either be length 1, or the +same length as the first argument. +These dots are evaluated with explicit splicing. |
+
---|
A vector the same length as the first ...
argument with
+missing values replaced by the first non-missing value.
na_if()
to replace specified values with a NA
.
+# Use a single value to replace all missing values +x <- sample(c(1:5, NA, NA, NA)) +coalesce(x, 0L)#> [1] 0 2 1 0 3 0 5 4+# Or match together a complete vector from missing pieces +y <- c(1, 2, NA, NA, 5) +z <- c(NA, NA, 3, 4, 5) +coalesce(y, z)#> [1] 1 2 3 4 5+# Supply lists by splicing them into dots: +vecs <- list( + c(1, 2, NA, NA, 5), + c(NA, NA, 3, 4, 5) +) +coalesce(!!! vecs)#> [1] 1 2 3 4 5
Extract out common by variables
+ + +common_by(by = NULL, x, y)+ + +
compute()
stores results in a remote temporary table.
+collect()
retrieves data into a local tibble.
+collapse()
is slightly different: it doesn't force computation, but
+instead forces generation of the SQL query. This is sometimes needed to work
+around bugs in dplyr's SQL generation.
compute(x, name = random_table_name(), ...) + +collect(x, ...) + +collapse(x, ...)+ +
x | +A tbl |
+
---|---|
name | +Name of temporary table on database. |
+
... | +Other arguments passed on to methods |
+
All functions preserve grouping and ordering.
+ +copy_to()
, the opposite of collect()
: it takes a local data
+frame and uploads it to the remote source.
+if (require(dbplyr)) { + mtcars2 <- src_memdb() %>% + copy_to(mtcars, name = "mtcars2-cc", overwrite = TRUE) + + remote <- mtcars2 %>% + filter(cyl == 8) %>% + select(mpg:drat) + + # Compute query and save in remote table + compute(remote) + + # Compute query bring back to this session + collect(remote) + + # Creates a fresh query based on the generated SQL + collapse(remote) +}#>#> +#>#>+#> +#>#>+#> +#>#> Source: SQL [?? x 5] +#> Database: sqlite 3.11.1 [:memory:] +#> +#> mpg cyl disp hp drat +#> <dbl> <dbl> <dbl> <dbl> <dbl> +#> 1 18.7 8 360.0 175 3.15 +#> 2 14.3 8 360.0 245 3.21 +#> 3 16.4 8 275.8 180 3.07 +#> 4 17.3 8 275.8 180 3.07 +#> 5 15.2 8 275.8 180 3.07 +#> 6 10.4 8 472.0 205 2.93 +#> 7 10.4 8 460.0 215 3.00 +#> 8 14.7 8 440.0 230 3.23 +#> 9 15.5 8 318.0 150 2.76 +#> 10 15.2 8 304.0 150 3.15 +#> # ... with more rows
This function uploads a local data frame into a remote data source, creating +the table definition as needed. Wherever possible, the new object will be +temporary, limited to the current connection to the source.
+ + +copy_to(dest, df, name = deparse(substitute(df)), overwrite = FALSE, ...)+ +
dest | +remote data source |
+
---|---|
df | +local data frame |
+
name | +name for new remote table. |
+
overwrite | +If |
+
... | +other parameters passed to methods. |
+
a tbl
object in the remote source
collect()
for the opposite action; downloading remote data into
+a local dbl.
+## Not run: ------------------------------------ +# iris2 <- src_memdb() %>% copy_to(iris, overwrite = TRUE) +# iris2 +## ---------------------------------------------
dplyr adds cumall()
, cumany()
, and cummean()
to complete
+R's set of cumulate functions to match the aggregation functions available
+in most databases
cumall(x) + +cumany(x) + +cummean(x)+ +
x | +For |
+
---|
Transform a vector into a format that will be sorted in descending order.
+This is useful within arrange()
.
desc(x)+ +
x | +vector to transform |
+
---|
+desc(1:10)#> [1] -1 -2 -3 -4 -5 -6 -7 -8 -9 -10desc(factor(letters))#> [1] -1 -2 -3 -4 -5 -6 -7 -8 -9 -10 -11 -12 -13 -14 -15 -16 -17 -18 -19 +#> [20] -20 -21 -22 -23 -24 -25 -26+first_day <- seq(as.Date("1910/1/1"), as.Date("1920/1/1"), "years") +desc(first_day)#> [1] 21915 21550 21185 20819 20454 20089 19724 19358 18993 18628 18263#> # A tibble: 87 × 13 +#> name height mass hair_color skin_color +#> <chr> <int> <dbl> <chr> <chr> +#> 1 Jabba Desilijic Tiure 175 1358 <NA> green-tan, brown +#> 2 Grievous 216 159 none brown, white +#> 3 IG-88 200 140 none metal +#> 4 Darth Vader 202 136 none white +#> 5 Tarfful 234 136 brown brown +#> 6 Owen Lars 178 120 brown, grey light +#> 7 Bossk 190 113 none green +#> 8 Chewbacca 228 112 brown unknown +#> 9 Jek Tono Porkins 180 110 brown fair +#> 10 Dexter Jettster 198 102 none brown +#> # ... with 77 more rows, and 8 more variables: eye_color <chr>, +#> # birth_year <dbl>, gender <chr>, homeworld <chr>, species <chr>, +#> # films <list>, vehicles <list>, starships <list>
Retain only unique/distinct rows from an input tbl. This is similar
+to unique.data.frame()
, but considerably faster.
distinct(.data, ..., .keep_all = FALSE)+ +
.data | +a tbl |
+
---|---|
... | +Optional variables to use when determining uniqueness. If there +are multiple rows for a given combination of inputs, only the first +row will be preserved. If omitted, will use all variables. |
+
.keep_all | +If |
+
+#> [1] 100nrow(distinct(df))#> [1] 67nrow(distinct(df, x, y))#> [1] 67+distinct(df, x)#> # A tibble: 10 × 1 +#> x +#> <int> +#> 1 6 +#> 2 8 +#> 3 4 +#> 4 9 +#> 5 2 +#> 6 1 +#> 7 10 +#> 8 7 +#> 9 5 +#> 10 3distinct(df, y)#> # A tibble: 10 × 1 +#> y +#> <int> +#> 1 7 +#> 2 2 +#> 3 3 +#> 4 9 +#> 5 6 +#> 6 4 +#> 7 8 +#> 8 1 +#> 9 5 +#> 10 10+# Can choose to keep all other variables as well +distinct(df, x, .keep_all = TRUE)#> # A tibble: 10 × 2 +#> x y +#> <int> <int> +#> 1 6 7 +#> 2 8 2 +#> 3 4 3 +#> 4 9 9 +#> 5 2 3 +#> 6 1 1 +#> 7 10 1 +#> 8 7 3 +#> 9 5 2 +#> 10 3 9distinct(df, y, .keep_all = TRUE)#> # A tibble: 10 × 2 +#> x y +#> <int> <int> +#> 1 6 7 +#> 2 8 2 +#> 3 4 3 +#> 4 9 9 +#> 5 8 6 +#> 6 2 4 +#> 7 4 8 +#> 8 1 1 +#> 9 2 5 +#> 10 9 10+# You can also use distinct on computed variables +distinct(df, diff = abs(x - y))#> # A tibble: 10 × 1 +#> diff +#> <int> +#> 1 1 +#> 2 6 +#> 3 0 +#> 4 2 +#> 5 3 +#> 6 5 +#> 7 4 +#> 8 9 +#> 9 7 +#> 10 8+# The same behaviour applies for grouped data frames +# except that the grouping variables are always included +df <- tibble( + g = c(1, 1, 2, 2), + x = c(1, 1, 2, 1) +) %>% group_by(g) +df %>% distinct()#> Source: local data frame [3 x 2] +#> Groups: g [2] +#> +#> g x +#> <dbl> <dbl> +#> 1 1 1 +#> 2 2 2 +#> 3 2 1df %>% distinct(x)#> Source: local data frame [3 x 2] +#> Groups: g [2] +#> +#> g x +#> <dbl> <dbl> +#> 1 1 1 +#> 2 2 2 +#> 3 2 1
This is a general purpose complement to the specialised manipulation
+functions filter()
, select()
, mutate()
,
+summarise()
and arrange()
. You can use do()
+to perform arbitrary computation, returning either a data frame or
+arbitrary objects which will be stored in a list. This is particularly
+useful when working with models: you can fit models per group with
+do()
and then flexibly extract components with either another
+do()
or summarise()
.
do(.data, ...)+ +
.data | +a tbl |
+
---|---|
... | +Expressions to apply to each group. If named, results will be
+stored in a new column. If unnamed, should return a data frame. You can
+use |
+
do()
always returns a data frame. The first columns in the data frame
+will be the labels, the others will be computed from ...
. Named
+arguments become list-columns, with one element for each group; unnamed
+elements must be data frames and labels will be duplicated accordingly.
Groups are preserved for a single unnamed input. This is different to
+summarise()
because do()
generally does not reduce the
+complexity of the data, it just expresses it in a special way. For
+multiple named inputs, the output is grouped by row with
+rowwise()
. This allows other verbs to work in an intuitive
+way.
For an empty data frame, the expressions will be evaluated once, even in the +presence of a grouping. This makes sure that the format of the resulting +data frame is the same for both empty and non-empty input.
+ +If you're familiar with plyr, do()
with named arguments is basically
+equivalent to plyr::dlply()
, and do()
with a single unnamed argument
+is basically equivalent to plyr::ldply()
. However, instead of storing
+labels in a separate attribute, the result is always a data frame. This
+means that summarise()
applied to the result of do()
can
+act like ldply()
.
+#> Source: local data frame [6 x 11] +#> Groups: cyl [3] +#> +#> mpg cyl disp hp drat wt qsec vs am gear carb +#> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> +#> 1 22.8 4 108.0 93 3.85 2.320 18.61 1 1 4 1 +#> 2 24.4 4 146.7 62 3.69 3.190 20.00 1 0 4 2 +#> 3 21.0 6 160.0 110 3.90 2.620 16.46 0 1 4 4 +#> 4 21.0 6 160.0 110 3.90 2.875 17.02 0 1 4 4 +#> 5 18.7 8 360.0 175 3.15 3.440 17.02 0 0 3 2 +#> 6 14.3 8 360.0 245 3.21 3.570 15.84 0 0 3 4+models <- by_cyl %>% do(mod = lm(mpg ~ disp, data = .)) +models#> Source: local data frame [3 x 2] +#> Groups: <by row> +#> +#> # A tibble: 3 × 2 +#> cyl mod +#> * <dbl> <list> +#> 1 4 <S3: lm> +#> 2 6 <S3: lm> +#> 3 8 <S3: lm>#> # A tibble: 3 × 1 +#> rsq +#> <dbl> +#> 1 0.64840514 +#> 2 0.01062604 +#> 3 0.27015777models %>% do(data.frame(coef = coef(.$mod)))#> Source: local data frame [6 x 1] +#> Groups: <by row> +#> +#> # A tibble: 6 × 1 +#> coef +#> * <dbl> +#> 1 40.871955322 +#> 2 -0.135141815 +#> 3 19.081987419 +#> 4 0.003605119 +#> 5 22.032798914 +#> 6 -0.019634095models %>% do(data.frame( + var = names(coef(.$mod)), + coef(summary(.$mod))) +)#> Source: local data frame [6 x 5] +#> Groups: <by row> +#> +#> # A tibble: 6 × 5 +#> var Estimate Std..Error t.value Pr...t.. +#> * <fctr> <dbl> <dbl> <dbl> <dbl> +#> 1 (Intercept) 40.871955322 3.589605400 11.3861973 1.202715e-06 +#> 2 disp -0.135141815 0.033171608 -4.0740206 2.782827e-03 +#> 3 (Intercept) 19.081987419 2.913992892 6.5483988 1.243968e-03 +#> 4 disp 0.003605119 0.015557115 0.2317344 8.259297e-01 +#> 5 (Intercept) 22.032798914 3.345241115 6.5863112 2.588765e-05 +#> 6 disp -0.019634095 0.009315926 -2.1075838 5.677488e-02+models <- by_cyl %>% do( + mod_linear = lm(mpg ~ disp, data = .), + mod_quad = lm(mpg ~ poly(disp, 2), data = .) +) +models#> Source: local data frame [3 x 3] +#> Groups: <by row> +#> +#> # A tibble: 3 × 3 +#> cyl mod_linear mod_quad +#> * <dbl> <list> <list> +#> 1 4 <S3: lm> <S3: lm> +#> 2 6 <S3: lm> <S3: lm> +#> 3 8 <S3: lm> <S3: lm>compare <- models %>% do(aov = anova(.$mod_linear, .$mod_quad)) +# compare %>% summarise(p.value = aov$`Pr(>F)`) + +if (require("nycflights13")) { +# You can use it to do any arbitrary computation, like fitting a linear +# model. Let's explore how carrier departure delays vary over the time +carriers <- group_by(flights, carrier) +group_size(carriers) + +mods <- do(carriers, mod = lm(arr_delay ~ dep_time, data = .)) +mods %>% do(as.data.frame(coef(.$mod))) +mods %>% summarise(rsq = summary(mod)$r.squared) + +## Not run: ------------------------------------ +# # This longer example shows the progress bar in action +# by_dest <- flights %>% group_by(dest) %>% filter(n() > 100) +# library(mgcv) +# by_dest %>% do(smooth = gam(arr_delay ~ s(dep_time) + month, data = .)) +## --------------------------------------------- +}#>#> # A tibble: 16 × 1 +#> rsq +#> <dbl> +#> 1 0.051350400 +#> 2 0.050413957 +#> 3 0.082775968 +#> 4 0.024073896 +#> 5 0.034721220 +#> 6 0.083602600 +#> 7 0.101147945 +#> 8 0.026441622 +#> 9 0.001700796 +#> 10 0.049918201 +#> 11 0.017496868 +#> 12 0.067322008 +#> 13 0.057505652 +#> 14 0.110919798 +#> 15 0.118660669 +#> 16 0.139066954
dplyr provides a flexible grammar of data manipulation. It's the next +iteration of plyr, focused on tools for working with data frames (hence the +d in the name).
+ + + +It has three main goals:
Identify the most important data manipulation verbs and make them +easy to use from R.
Provide blazing fast performance for in-memory data by writing key +pieces in C++ (using Rcpp)
Use the same interface to work with data no matter where it's stored, +whether in a data frame, a data table or database.
To learn more about dplyr, start with the vignettes:
+browseVignettes(package = "dplyr")
dplyr.show_progress
Should lengthy operations such as do()
+show a progress bar? Default: TRUE
These can be set on a package-by-package basis, or for the global environment.
+See pkgconfig::set_config()
for usage.
dplyr::na_matches
Should NA
values be matched in data frame joins
+by default? Default: "never"
, alternative value: "na"
. See also
+join.tbl_df()
.
Useful links:
Report bugs at https://github.com/hadley/tidyverse/issues
This is a generic function which gives more details about an object than
+print()
, and is more focussed on human readable output than
+str()
.
explain(x, ...) + +show_query(x, ...)+ +
x | +An object to explain |
+
---|---|
... | +Other parameters possibly used by generic |
+
The first argument, invisibly.
+ +Explaining a tbl_sql
will run the SQL EXPLAIN
command which
+will describe the query plan. This requires a little bit of knowledge about
+how EXPLAIN
works for your database, but is very useful for
+diagnosing performance problems.
++if (require("dbplyr")) { + +lahman_s <- lahman_sqlite() +batting <- tbl(lahman_s, "Batting") +batting %>% show_query() +batting %>% explain() + +# The batting database has indices on all ID variables: +# SQLite automatically picks the most restrictive index +batting %>% filter(lgID == "NL" & yearID == 2000L) %>% explain() + +# OR's will use multiple indexes +batting %>% filter(lgID == "NL" | yearID == 2000) %>% explain() + +# Joins will use indexes in both tables +teams <- tbl(lahman_s, "Teams") +batting %>% left_join(teams, c("yearID", "teamID")) %>% explain() +}#>#>#>#>#>#>#>#>#>#>#>#>#>#>#>#>#>#>#>#>#>#>#>#>#>#>+#> +#>#>+#> +#>#>#> Error in UseMethod("db_explain"): no applicable method for 'db_explain' applied to an object of class "NULL"+
Deprecated. Please use purrr::possibly()
instead.
failwith(default = NULL, f, quiet = FALSE)+ +
default | +default value |
+
---|---|
f | +function |
+
quiet | +all error messages be suppressed? |
+
a function
+ +Use filter()
find rows/cases where conditions are true. Unlike
+base subsetting, rows where the condition evaluates to NA
are dropped.
filter(.data, ...)+ +
.data | +A tbl. All main verbs are S3 generics and provide methods
+for |
+
---|---|
... | +Logical predicates defined in terms of the variables in These arguments are automatically quoted and
+evaluated in the context of the data
+frame. They support unquoting and
+splicing. See |
+
An object of the same class as .data
.
Note that dplyr is not yet smart enough to optimise filtering optimisation
+on grouped datasets that don't need grouped calculations. For this reason,
+filtering is often considerably faster on ungroup()
ed data.
When applied to a data frame, row names are silently dropped. To preserve,
+convert to an explicit variable with tibble::rownames_to_column()
.
The three scoped variants (filter_all()
, filter_if()
and
+filter_at()
) make it easy to apply a filtering condition to a
+selection of variables.
filter_all()
, filter_if()
and filter_at()
.
Other single table verbs: arrange
,
+ mutate
, select
,
+ slice
, summarise
+filter(starwars, species == "Human")#> # A tibble: 35 × 13 +#> name height mass hair_color skin_color eye_color +#> <chr> <int> <dbl> <chr> <chr> <chr> +#> 1 Luke Skywalker 172 77 blond fair blue +#> 2 Darth Vader 202 136 none white yellow +#> 3 Leia Organa 150 49 brown light brown +#> 4 Owen Lars 178 120 brown, grey light blue +#> 5 Beru Whitesun lars 165 75 brown light blue +#> 6 Biggs Darklighter 183 84 black light brown +#> 7 Obi-Wan Kenobi 182 77 auburn, white fair blue-gray +#> 8 Anakin Skywalker 188 84 blond fair blue +#> 9 Wilhuff Tarkin 180 NA auburn, grey fair blue +#> 10 Han Solo 180 80 brown fair brown +#> # ... with 25 more rows, and 7 more variables: birth_year <dbl>, gender <chr>, +#> # homeworld <chr>, species <chr>, films <list>, vehicles <list>, +#> # starships <list>filter(starwars, mass > 1000)#> # A tibble: 1 × 13 +#> name height mass hair_color skin_color eye_color +#> <chr> <int> <dbl> <chr> <chr> <chr> +#> 1 Jabba Desilijic Tiure 175 1358 <NA> green-tan, brown orange +#> # ... with 7 more variables: birth_year <dbl>, gender <chr>, homeworld <chr>, +#> # species <chr>, films <list>, vehicles <list>, starships <list>+# Multiple criteria +filter(starwars, hair_color == "none" & eye_color == "black")#> # A tibble: 9 × 13 +#> name height mass hair_color skin_color eye_color birth_year +#> <chr> <int> <dbl> <chr> <chr> <chr> <dbl> +#> 1 Nien Nunb 160 68 none grey black NA +#> 2 Gasgano 122 NA none white, blue black NA +#> 3 Kit Fisto 196 87 none green black NA +#> 4 Plo Koon 188 80 none orange black 22 +#> 5 Lama Su 229 88 none grey black NA +#> 6 Taun We 213 NA none grey black NA +#> 7 Shaak Ti 178 57 none red, blue, white black NA +#> 8 Tion Medon 206 80 none grey black NA +#> 9 BB8 NA NA none none black NA +#> # ... with 6 more variables: gender <chr>, homeworld <chr>, species <chr>, +#> # films <list>, vehicles <list>, starships <list>filter(starwars, hair_color == "none" | eye_color == "black")#> # A tibble: 38 × 13 +#> name height mass hair_color skin_color eye_color birth_year +#> <chr> <int> <dbl> <chr> <chr> <chr> <dbl> +#> 1 Darth Vader 202 136 none white yellow 41.9 +#> 2 Greedo 173 74 <NA> green black 44.0 +#> 3 IG-88 200 140 none metal red 15.0 +#> 4 Bossk 190 113 none green red 53.0 +#> 5 Lobot 175 79 none light blue 37.0 +#> 6 Ackbar 180 83 none brown mottle orange 41.0 +#> 7 Nien Nunb 160 68 none grey black NA +#> 8 Nute Gunray 191 90 none mottled green red NA +#> 9 Jar Jar Binks 196 66 none orange orange 52.0 +#> 10 Roos Tarpals 224 82 none grey orange NA +#> # ... with 28 more rows, and 6 more variables: gender <chr>, homeworld <chr>, +#> # species <chr>, films <list>, vehicles <list>, starships <list>+# Multiple arguments are equivalent to and +filter(starwars, hair_color == "none", eye_color == "black")#> # A tibble: 9 × 13 +#> name height mass hair_color skin_color eye_color birth_year +#> <chr> <int> <dbl> <chr> <chr> <chr> <dbl> +#> 1 Nien Nunb 160 68 none grey black NA +#> 2 Gasgano 122 NA none white, blue black NA +#> 3 Kit Fisto 196 87 none green black NA +#> 4 Plo Koon 188 80 none orange black 22 +#> 5 Lama Su 229 88 none grey black NA +#> 6 Taun We 213 NA none grey black NA +#> 7 Shaak Ti 178 57 none red, blue, white black NA +#> 8 Tion Medon 206 80 none grey black NA +#> 9 BB8 NA NA none none black NA +#> # ... with 6 more variables: gender <chr>, homeworld <chr>, species <chr>, +#> # films <list>, vehicles <list>, starships <list>
These scoped filtering verbs apply a predicate expression to a
+selection of variables. The predicate expression should be quoted
+with all_vars()
or any_vars()
and should mention the pronoun
+.
to refer to variables.
filter_all(.tbl, .vars_predicate) + +filter_if(.tbl, .predicate, .vars_predicate) + +filter_at(.tbl, .vars, .vars_predicate)+ +
.tbl | +A |
+
---|---|
.vars_predicate | +A quoted predicate expression as returned by
+ |
+
.predicate | +A predicate function to be applied to the columns
+or a logical vector. The variables for which |
+
.vars | +A list of columns generated by |
+
+# While filter() accepts expressions with specific variables, the +# scoped filter verbs take an expression with the pronoun `.` and +# replicate it over all variables. This expression should be quoted +# with all_vars() or any_vars(): +all_vars(is.na(.))#> <predicate intersection> +#> ~is.na(.) +#> <environment: 0x10e664068>#> <predicate union> +#> ~is.na(.) +#> <environment: 0x10e664068>+ +# You can take the intersection of the replicated expressions: +filter_all(mtcars, all_vars(. > 150))#> [1] mpg cyl disp hp drat wt qsec vs am gear carb +#> <0 rows> (or 0-length row.names)#> mpg cyl disp hp drat wt qsec vs am gear carb +#> 1 21.0 6 160.0 110 3.90 2.620 16.46 0 1 4 4 +#> 2 21.0 6 160.0 110 3.90 2.875 17.02 0 1 4 4 +#> 3 21.4 6 258.0 110 3.08 3.215 19.44 1 0 3 1 +#> 4 18.7 8 360.0 175 3.15 3.440 17.02 0 0 3 2 +#> 5 18.1 6 225.0 105 2.76 3.460 20.22 1 0 3 1 +#> 6 14.3 8 360.0 245 3.21 3.570 15.84 0 0 3 4 +#> 7 19.2 6 167.6 123 3.92 3.440 18.30 1 0 4 4 +#> 8 17.8 6 167.6 123 3.92 3.440 18.90 1 0 4 4 +#> 9 16.4 8 275.8 180 3.07 4.070 17.40 0 0 3 3 +#> 10 17.3 8 275.8 180 3.07 3.730 17.60 0 0 3 3 +#> 11 15.2 8 275.8 180 3.07 3.780 18.00 0 0 3 3 +#> 12 10.4 8 472.0 205 2.93 5.250 17.98 0 0 3 4 +#> 13 10.4 8 460.0 215 3.00 5.424 17.82 0 0 3 4 +#> 14 14.7 8 440.0 230 3.23 5.345 17.42 0 0 3 4 +#> 15 15.5 8 318.0 150 2.76 3.520 16.87 0 0 3 2 +#> 16 15.2 8 304.0 150 3.15 3.435 17.30 0 0 3 2 +#> 17 13.3 8 350.0 245 3.73 3.840 15.41 0 0 3 4 +#> 18 19.2 8 400.0 175 3.08 3.845 17.05 0 0 3 2 +#> 19 15.8 8 351.0 264 4.22 3.170 14.50 0 1 5 4 +#> 20 19.7 6 145.0 175 3.62 2.770 15.50 0 1 5 6 +#> 21 15.0 8 301.0 335 3.54 3.570 14.60 0 1 5 8+ +# You can vary the selection of columns on which to apply the +# predicate. filter_at() takes a vars() specification: +filter_at(mtcars, vars(starts_with("d")), any_vars((. %% 2) == 0))#> mpg cyl disp hp drat wt qsec vs am gear carb +#> 1 21.0 6 160 110 3.90 2.620 16.46 0 1 4 4 +#> 2 21.0 6 160 110 3.90 2.875 17.02 0 1 4 4 +#> 3 22.8 4 108 93 3.85 2.320 18.61 1 1 4 1 +#> 4 21.4 6 258 110 3.08 3.215 19.44 1 0 3 1 +#> 5 18.7 8 360 175 3.15 3.440 17.02 0 0 3 2 +#> 6 14.3 8 360 245 3.21 3.570 15.84 0 0 3 4 +#> 7 10.4 8 472 205 2.93 5.250 17.98 0 0 3 4 +#> 8 10.4 8 460 215 3.00 5.424 17.82 0 0 3 4 +#> 9 14.7 8 440 230 3.23 5.345 17.42 0 0 3 4 +#> 10 15.5 8 318 150 2.76 3.520 16.87 0 0 3 2 +#> 11 15.2 8 304 150 3.15 3.435 17.30 0 0 3 2 +#> 12 13.3 8 350 245 3.73 3.840 15.41 0 0 3 4 +#> 13 19.2 8 400 175 3.08 3.845 17.05 0 0 3 2+# And filter_if() selects variables with a predicate function: +filter_if(mtcars, ~ all(floor(.) == .), all_vars(. != 0))#> mpg cyl disp hp drat wt qsec vs am gear carb +#> 1 22.8 4 108.0 93 3.85 2.320 18.61 1 1 4 1 +#> 2 32.4 4 78.7 66 4.08 2.200 19.47 1 1 4 1 +#> 3 30.4 4 75.7 52 4.93 1.615 18.52 1 1 4 2 +#> 4 33.9 4 71.1 65 4.22 1.835 19.90 1 1 4 1 +#> 5 27.3 4 79.0 66 4.08 1.935 18.90 1 1 4 1 +#> 6 30.4 4 95.1 113 3.77 1.513 16.90 1 1 5 2 +#> 7 21.4 4 121.0 109 4.11 2.780 18.60 1 1 4 2
funs()
provides a flexible way to generate a named list of
+functions for input to other functions like summarise_at()
.
funs(..., .args = list())+ +
... | +A list of functions specified by:
These arguments are automatically quoted. They
+support unquoting and splicing. See
+ |
+
---|---|
.args, args | +A named list of additional arguments to be added +to all function calls. |
+
+funs(mean, "mean", mean(., na.rm = TRUE))#> <fun_calls> +#> $ mean: mean(.) +#> $ mean: mean(.) +#> $ mean: mean(., na.rm = TRUE)+# Override default names +funs(m1 = mean, m2 = "mean", m3 = mean(., na.rm = TRUE))#> <fun_calls> +#> $ m1: mean(.) +#> $ m2: mean(.) +#> $ m3: mean(., na.rm = TRUE)#> <fun_calls> +#> $ min: min(.) +#> $ max: max(.)
Most data operations are usefully done on groups defined by variables.
+group_by()
takes an existing tbl and converts it into a grouped tbl
+where operations are performed "by group".
+
+ groups()
and group_vars()
tell you how a table is grouped.
+ungroup()
removes grouping.
group_by(.data, ..., add = FALSE) + +groups(x) + +group_vars(x) + +ungroup(x, ...)+ +
.data | +a tbl |
+
---|---|
... | +Variables to group by. All tbls accept variable names, +some will also accept functions of variables. Duplicated groups +will be silently dropped. |
+
add | +When |
+
x | +data |
+
group_by()
is an S3 generic with methods for the three built-in
+tbls. See the help for the corresponding classes and their manip
+methods for more details:
data.frame: grouped_df
data.table: dtplyr::grouped_dt
SQLite: src_sqlite()
PostgreSQL: src_postgres()
MySQL: src_mysql()
The three scoped variants (group_by_all()
, group_by_if()
and
+group_by_at()
) make it easy to group a dataset by a selection of
+variables.
+by_cyl <- mtcars %>% group_by(cyl) + +# grouping doesn't change how the data looks (apart from listing +# how it's grouped): +by_cyl#> Source: local data frame [32 x 11] +#> Groups: cyl [3] +#> +#> mpg cyl disp hp drat wt qsec vs am gear carb +#> * <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> +#> 1 21.0 6 160.0 110 3.90 2.620 16.46 0 1 4 4 +#> 2 21.0 6 160.0 110 3.90 2.875 17.02 0 1 4 4 +#> 3 22.8 4 108.0 93 3.85 2.320 18.61 1 1 4 1 +#> 4 21.4 6 258.0 110 3.08 3.215 19.44 1 0 3 1 +#> 5 18.7 8 360.0 175 3.15 3.440 17.02 0 0 3 2 +#> 6 18.1 6 225.0 105 2.76 3.460 20.22 1 0 3 1 +#> 7 14.3 8 360.0 245 3.21 3.570 15.84 0 0 3 4 +#> 8 24.4 4 146.7 62 3.69 3.190 20.00 1 0 4 2 +#> 9 22.8 4 140.8 95 3.92 3.150 22.90 1 0 4 2 +#> 10 19.2 6 167.6 123 3.92 3.440 18.30 1 0 4 4 +#> # ... with 22 more rows+# It changes how it acts with the other dplyr verbs: +by_cyl %>% summarise( + disp = mean(disp), + hp = mean(hp) +)#> # A tibble: 3 × 3 +#> cyl disp hp +#> <dbl> <dbl> <dbl> +#> 1 4 105.1364 82.63636 +#> 2 6 183.3143 122.28571 +#> 3 8 353.1000 209.21429#> Source: local data frame [3 x 11] +#> Groups: cyl [3] +#> +#> mpg cyl disp hp drat wt qsec vs am gear carb +#> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> +#> 1 21.4 6 258.0 110 3.08 3.215 19.44 1 0 3 1 +#> 2 24.4 4 146.7 62 3.69 3.190 20.00 1 0 4 2 +#> 3 10.4 8 472.0 205 2.93 5.250 17.98 0 0 3 4+# Each call to summarise() removes a layer of grouping +by_vs_am <- mtcars %>% group_by(vs, am) +by_vs <- by_vs_am %>% summarise(n = n()) +by_vs#> Source: local data frame [4 x 3] +#> Groups: vs [?] +#> +#> vs am n +#> <dbl> <dbl> <int> +#> 1 0 0 12 +#> 2 0 1 6 +#> 3 1 0 7 +#> 4 1 1 7#> # A tibble: 2 × 2 +#> vs n +#> <dbl> <int> +#> 1 0 18 +#> 2 1 14#> # A tibble: 1 × 1 +#> n +#> <int> +#> 1 32+# You can group by expressions: this is just short-hand for +# a mutate/rename followed by a simple group_by +mtcars %>% group_by(vsam = vs + am)#> Source: local data frame [32 x 12] +#> Groups: vsam [3] +#> +#> mpg cyl disp hp drat wt qsec vs am gear carb vsam +#> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> +#> 1 21.0 6 160.0 110 3.90 2.620 16.46 0 1 4 4 1 +#> 2 21.0 6 160.0 110 3.90 2.875 17.02 0 1 4 4 1 +#> 3 22.8 4 108.0 93 3.85 2.320 18.61 1 1 4 1 2 +#> 4 21.4 6 258.0 110 3.08 3.215 19.44 1 0 3 1 1 +#> 5 18.7 8 360.0 175 3.15 3.440 17.02 0 0 3 2 0 +#> 6 18.1 6 225.0 105 2.76 3.460 20.22 1 0 3 1 1 +#> 7 14.3 8 360.0 245 3.21 3.570 15.84 0 0 3 4 0 +#> 8 24.4 4 146.7 62 3.69 3.190 20.00 1 0 4 2 1 +#> 9 22.8 4 140.8 95 3.92 3.150 22.90 1 0 4 2 1 +#> 10 19.2 6 167.6 123 3.92 3.440 18.30 1 0 4 4 1 +#> # ... with 22 more rows+# By default, group_by overrides existing grouping +by_cyl %>% + group_by(vs, am) %>% + group_vars()#> [1] "vs" "am"+# Use add = TRUE to instead append +by_cyl %>% + group_by(vs, am, add = TRUE) %>% + group_vars()#> [1] "cyl" "vs" "am"
These scoped variants of group_by()
group a data frame by a
+selection of variables. Like group_by()
, they have optional
+mutate semantics.
group_by_all(.tbl, .funs = list(), ...) + +group_by_at(.tbl, .vars, .funs = list(), ..., .add = FALSE) + +group_by_if(.tbl, .predicate, .funs = list(), ..., .add = FALSE)+ +
.tbl | +A |
+
---|---|
.funs | +List of function calls generated by |
+
... | +Additional arguments for the function calls in
+ |
+
.vars | +A list of columns generated by |
+
.add | +Passed to the |
+
.predicate | +A predicate function to be applied to the columns
+or a logical vector. The variables for which |
+
+# Group a data frame by all variables: +group_by_all(mtcars)#> Source: local data frame [32 x 11] +#> Groups: mpg, cyl, disp, hp, drat, wt, qsec, vs, am, gear, carb [32] +#> +#> mpg cyl disp hp drat wt qsec vs am gear carb +#> * <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> +#> 1 21.0 6 160.0 110 3.90 2.620 16.46 0 1 4 4 +#> 2 21.0 6 160.0 110 3.90 2.875 17.02 0 1 4 4 +#> 3 22.8 4 108.0 93 3.85 2.320 18.61 1 1 4 1 +#> 4 21.4 6 258.0 110 3.08 3.215 19.44 1 0 3 1 +#> 5 18.7 8 360.0 175 3.15 3.440 17.02 0 0 3 2 +#> 6 18.1 6 225.0 105 2.76 3.460 20.22 1 0 3 1 +#> 7 14.3 8 360.0 245 3.21 3.570 15.84 0 0 3 4 +#> 8 24.4 4 146.7 62 3.69 3.190 20.00 1 0 4 2 +#> 9 22.8 4 140.8 95 3.92 3.150 22.90 1 0 4 2 +#> 10 19.2 6 167.6 123 3.92 3.440 18.30 1 0 4 4 +#> # ... with 22 more rows+# Group by variables selected with a predicate: +group_by_if(iris, is.factor)#> Source: local data frame [150 x 5] +#> Groups: Species [3] +#> +#> Sepal.Length Sepal.Width Petal.Length Petal.Width Species +#> <dbl> <dbl> <dbl> <dbl> <fctr> +#> 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 +#> 7 4.6 3.4 1.4 0.3 setosa +#> 8 5.0 3.4 1.5 0.2 setosa +#> 9 4.4 2.9 1.4 0.2 setosa +#> 10 4.9 3.1 1.5 0.1 setosa +#> # ... with 140 more rows#> Source: local data frame [32 x 11] +#> Groups: vs, am [4] +#> +#> mpg cyl disp hp drat wt qsec vs am gear carb +#> * <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> +#> 1 21.0 6 160.0 110 3.90 2.620 16.46 0 1 4 4 +#> 2 21.0 6 160.0 110 3.90 2.875 17.02 0 1 4 4 +#> 3 22.8 4 108.0 93 3.85 2.320 18.61 1 1 4 1 +#> 4 21.4 6 258.0 110 3.08 3.215 19.44 1 0 3 1 +#> 5 18.7 8 360.0 175 3.15 3.440 17.02 0 0 3 2 +#> 6 18.1 6 225.0 105 2.76 3.460 20.22 1 0 3 1 +#> 7 14.3 8 360.0 245 3.21 3.570 15.84 0 0 3 4 +#> 8 24.4 4 146.7 62 3.69 3.190 20.00 1 0 4 2 +#> 9 22.8 4 140.8 95 3.92 3.150 22.90 1 0 4 2 +#> 10 19.2 6 167.6 123 3.92 3.440 18.30 1 0 4 4 +#> # ... with 22 more rows+# Like group_by(), the scoped variants have optional mutate +# semantics. This provide a shortcut for group_by() + mutate(): +group_by_all(mtcars, as.factor)#> Source: local data frame [32 x 11] +#> Groups: mpg, cyl, disp, hp, drat, wt, qsec, vs, am, gear, carb [32] +#> +#> mpg cyl disp hp drat wt qsec vs am gear carb +#> <fctr> <fctr> <fctr> <fctr> <fctr> <fctr> <fctr> <fctr> <fctr> <fctr> <fctr> +#> 1 21 6 160 110 3.9 2.62 16.46 0 1 4 4 +#> 2 21 6 160 110 3.9 2.875 17.02 0 1 4 4 +#> 3 22.8 4 108 93 3.85 2.32 18.61 1 1 4 1 +#> 4 21.4 6 258 110 3.08 3.215 19.44 1 0 3 1 +#> 5 18.7 8 360 175 3.15 3.44 17.02 0 0 3 2 +#> 6 18.1 6 225 105 2.76 3.46 20.22 1 0 3 1 +#> 7 14.3 8 360 245 3.21 3.57 15.84 0 0 3 4 +#> 8 24.4 4 146.7 62 3.69 3.19 20 1 0 4 2 +#> 9 22.8 4 140.8 95 3.92 3.15 22.9 1 0 4 2 +#> 10 19.2 6 167.6 123 3.92 3.44 18.3 1 0 4 4 +#> # ... with 22 more rowsgroup_by_if(iris, is.factor, as.character)#> Source: local data frame [150 x 5] +#> Groups: Species [3] +#> +#> Sepal.Length Sepal.Width Petal.Length Petal.Width Species +#> <dbl> <dbl> <dbl> <dbl> <chr> +#> 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 +#> 7 4.6 3.4 1.4 0.3 setosa +#> 8 5.0 3.4 1.5 0.2 setosa +#> 9 4.4 2.9 1.4 0.2 setosa +#> 10 4.9 3.1 1.5 0.1 setosa +#> # ... with 140 more rows
Performs standard operations that should happen before individual methods +process the data. This includes mutating the tbl to add new grouping columns +and updating the groups (based on add)
+ + +group_by_prepare(.data, ..., .dots = list(), add = FALSE)+ +
A list
+Modified tbl
Modified groups
Generate a unique id for each group
+ + +group_indices(.data, ...)+ +
.data | +a tbl |
+
---|---|
... | +Variables to group by. All tbls accept variable names, +some will also accept functions of variables. Duplicated groups +will be silently dropped. |
+
+group_indices(mtcars, cyl)#> [1] 2 2 1 2 3 2 3 1 1 2 2 3 3 3 3 3 3 1 1 1 1 3 3 3 3 1 1 1 3 2 3 1
Calculate group sizes.
+ + +group_size(x) + +n_groups(x)+ +
x | +a grouped tbl |
+
---|
+if (require("nycflights13")) { + +by_day <- flights %>% group_by(year, month, day) +n_groups(by_day) +group_size(by_day) + +by_dest <- flights %>% group_by(dest) +n_groups(by_dest) +group_size(by_dest) +}#> [1] 254 265 439 8 17215 2439 275 443 375 297 6333 15508 +#> [13] 896 2589 4681 371 1781 36 116 864 52 2884 4573 14064 +#> [25] 3524 138 3941 1525 9705 7266 8738 569 9384 213 17 12055 +#> [37] 765 1606 849 15 707 2115 5700 7198 110 2077 25 2720 +#> [49] 5997 16174 1 1 668 2008 14082 4113 1789 1009 11728 2802 +#> [61] 572 7185 3799 15 221 59 312 346 849 17283 1536 6554 +#> [73] 1354 1632 4656 2875 365 19 376 2352 8163 2454 2416 3537 +#> [85] 2737 686 804 10 1157 3923 13331 329 5819 2467 284 825 +#> [97] 1211 4339 522 1761 7466 315 101 631 1036
The easiest way to create a grouped data frame is to call the group_by()
+method on a data frame or tbl: this will take care of capturing
+the unevaluated expressions for you.
grouped_df(data, vars, drop = TRUE) + +is.grouped_df(x) + +is_grouped_df(x)+ +
data | +a tbl or data frame. |
+
---|---|
vars | +a character vector or a list of |
+
drop | +if |
+
Properties:
order(id)
is equivalent to do.call(order, df)
rows containing the same data have the same value
if drop = FALSE
then room for all possibilites
id(.variables, drop = FALSE)+ +
.variables | +list of variables |
+
---|---|
drop | +drop unusued factor levels? |
+
a numeric vector with attribute n, giving total number of +possibilities
+ + +Compared to the base ifelse()
, this function is more strict.
+It checks that true
and false
are the same type. This
+strictness makes the output type more predictable, and makes it somewhat
+faster.
if_else(condition, true, false, missing = NULL)+ +
condition | +Logical vector |
+
---|---|
true, false | +Values to use for |
+
missing | +If not |
+
Where condition
is TRUE
, the matching value from
+true
, where it's FALSE
, the matching value from false
,
+otherwise NA
.
+x <- c(-5:5, NA) +if_else(x < 0, NA_integer_, x)#> [1] NA NA NA NA NA 0 1 2 3 4 5 NAif_else(x < 0, "negative", "positive", "missing")#> [1] "negative" "negative" "negative" "negative" "negative" "positive" +#> [7] "positive" "positive" "positive" "positive" "positive" "missing"+# Unlike ifelse, if_else preserves types +x <- factor(sample(letters[1:5], 10, replace = TRUE)) +ifelse(x %in% c("a", "b", "c"), x, factor(NA))#> [1] 2 3 1 NA NA NA 3 NA 3 NAif_else(x %in% c("a", "b", "c"), x, factor(NA))#> [1] b c a <NA> <NA> <NA> c <NA> c <NA> +#> Levels: a b c d e# Attributes are taken from the `true` vector,
+ All functions+ + |
+ |
---|---|
+ + | +Flexible equality comparison for data frames. |
+
+ + | +Apply predicate to all variables. |
+
+ + | +Arrange rows by variables |
+
+
|
+ Coerce a <code>tbl_cube</code> to other data structures |
+
+
|
+ Coerce an existing data structure into a <code>tbl_cube</code> |
+
+ + | +Copy tables to same source, if necessary. |
+
+ + | +Band membership |
+
+
|
+ Evaluate, compare, benchmark operations of a set of srcs. |
+
+ + | +Do values in a numeric vector fall in specified range? |
+
+
|
+ Efficiently bind multiple data frames by row and column. |
+
+ + | +A general vectorised if. |
+
+ + | +Find first non-missing element |
+
+ + | +Force computation of a database query |
+
+ + | +Copy a local data frame to a remote src. |
+
+ + | +Cumulativate versions of any, all, and mean |
+
+ + | +Descending order. |
+
+ + | +Select distinct/unique rows. |
+
+ + | +Do arbitrary operations on a tbl. |
+
+ + | +dplyr: a grammar of data manipulation |
+
+ + | +Explain details of a tbl |
+
+ + | +Filter within a selection of variables. |
+
+ + | +Return rows with matching conditions |
+
+ + | +Create a list of functions calls. |
+
+ + | +Group by a selection of variables. |
+
+ + | +Group a tbl by one or more variables. |
+
+ + | +Group id. |
+
+ + | +Calculate group sizes. |
+
+ + | +Vectorised if. |
+
+
|
+ Join two tbls together |
+
+
|
+ Join data frame tbls. |
+
+ + | +Lead and lag. |
+
+ + | +Print the location in memory of a data frame |
+
+ + | +Add new variables |
+
+ + | +Efficiently count the number of unique values in a set of vector |
+
+ + | +The number of observations in the current group. |
+
+ + | +Convert values to NA. |
+
+ + | +NASA spatio-temporal data |
+
+ + | +Compare two numeric vectors. |
+
+ + | +Extract the first, last or nth value from a vector. |
+
+ + | +A helper function for ordering window function output |
+
+ + | +Pull out a single variable |
+
+
|
+ Windowed rank functions. |
+
+ + | +Recode values |
+
+ + | +Group input by rows |
+
+ + | +Sample n rows from a table. |
+
+ + | +Operate on a selection of variables. |
+
+
|
+ Deprecated SE versions of main verbs. |
+
+
|
+ Select and rename a selection of variables. |
+
+
|
+ Select helpers |
+
+ + | +Select/rename variables by name |
+
+ + | +Set operations. |
+
+ + | +Select rows by position |
+
+ + | +Source for database backends |
+
+ + | +List all tbls provided by a source. |
+
+ + | +Starwars characters |
+
+ + | +Storm tracks data |
+
+
|
+ Summarise and mutate multiple columns. |
+
+ + | +Summarise multiple values to a single value |
+
+ + | +Counts/tally observations by group. |
+
+ + | +A data cube tbl. |
+
+ + | +List variables provided by a tbl. |
+
+ + | +Create a table from a data source |
+
+ + | +Select top (or bottom) n rows (by value). |
+
+ + | +Select variables. |
+
These are generic functions that dispatch to individual tbl methods - see the
+method documentation for details of individual data sources. x
and
+y
should usually be from the same data source, but if copy
is
+TRUE
, y
will automatically be copied to the same source as x
.
inner_join(x, y, by = NULL, copy = FALSE, suffix = c(".x", ".y"), ...) + +left_join(x, y, by = NULL, copy = FALSE, suffix = c(".x", ".y"), ...) + +right_join(x, y, by = NULL, copy = FALSE, suffix = c(".x", ".y"), ...) + +full_join(x, y, by = NULL, copy = FALSE, suffix = c(".x", ".y"), ...) + +semi_join(x, y, by = NULL, copy = FALSE, ...) + +anti_join(x, y, by = NULL, copy = FALSE, ...)+ +
x, y | +tbls to join |
+
---|---|
by | +a character vector of variables to join by. If To join by different variables on x and y use a named vector.
+For example, |
+
copy | +If |
+
suffix | +If there are non-joined duplicate variables in |
+
... | +other parameters passed onto methods |
+
Currently dplyr supports four join types:
inner_join()
return all rows from x
where there are matching
+values in y
, and all columns from x
and y
. If there are multiple matches
+between x
and y
, all combination of the matches are returned.
left_join()
return all rows from x
, and all columns from x
+and y
. Rows in x
with no match in y
will have NA
values in the new
+columns. If there are multiple matches between x
and y
, all combinations
+of the matches are returned.
right_join()
return all rows from y
, and all columns from x
+and y. Rows in y
with no match in x
will have NA
values in the new
+columns. If there are multiple matches between x
and y
, all combinations
+of the matches are returned.
semi_join()
return all rows from x
where there are matching
+values in y
, keeping just columns from x
.
+ A semi join differs from an inner join because an inner join will return
+one row of x
for each matching row of y
, where a semi
+join will never duplicate rows of x
.
anti_join()
return all rows from x
where there are not
+matching values in y
, keeping just columns from x
.
full_join()
return all rows and all columns from both x
and y
.
+Where there are not matching values, returns NA
for the one missing.
Groups are ignored for the purpose of joining, but the result preserves
+the grouping of x
.
+# "Mutating" joins add variables to the LHS +band_members %>% inner_join(band_instruments)#>#> # A tibble: 2 × 3 +#> name band plays +#> <chr> <chr> <chr> +#> 1 John Beatles guitar +#> 2 Paul Beatles bassband_members %>% left_join(band_instruments)#>#> # A tibble: 3 × 3 +#> name band plays +#> <chr> <chr> <chr> +#> 1 Mick Stones <NA> +#> 2 John Beatles guitar +#> 3 Paul Beatles bassband_members %>% right_join(band_instruments)#>#> # A tibble: 3 × 3 +#> name band plays +#> <chr> <chr> <chr> +#> 1 John Beatles guitar +#> 2 Paul Beatles bass +#> 3 Keith <NA> guitarband_members %>% full_join(band_instruments)#>#> # A tibble: 4 × 3 +#> name band plays +#> <chr> <chr> <chr> +#> 1 Mick Stones <NA> +#> 2 John Beatles guitar +#> 3 Paul Beatles bass +#> 4 Keith <NA> guitar+# "Filtering" joins keep cases from the LHS +band_members %>% semi_join(band_instruments)#>#> # A tibble: 2 × 2 +#> name band +#> <chr> <chr> +#> 1 John Beatles +#> 2 Paul Beatlesband_members %>% anti_join(band_instruments)#>#> # A tibble: 1 × 2 +#> name band +#> <chr> <chr> +#> 1 Mick Stones+# To suppress the message, supply by +band_members %>% inner_join(band_instruments, by = "name")#> # A tibble: 2 × 3 +#> name band plays +#> <chr> <chr> <chr> +#> 1 John Beatles guitar +#> 2 Paul Beatles bass# This is good practice in production code + +# Use a named `by` if the join variables have different names +band_members %>% full_join(band_instruments2, by = c("name" = "artist"))#> # A tibble: 4 × 3 +#> name band plays +#> <chr> <chr> <chr> +#> 1 Mick Stones <NA> +#> 2 John Beatles guitar +#> 3 Paul Beatles bass +#> 4 Keith <NA> guitar# Note that only the key from the LHS is kept
See join for a description of the general purpose of the +functions.
+ + +# S3 method for tbl_df +inner_join(x, y, by = NULL, copy = FALSE, + suffix = c(".x", ".y"), ..., + na_matches = pkgconfig::get_config("dplyr::na_matches")) + +# S3 method for tbl_df +left_join(x, y, by = NULL, copy = FALSE, suffix = c(".x", + ".y"), ..., na_matches = pkgconfig::get_config("dplyr::na_matches")) + +# S3 method for tbl_df +right_join(x, y, by = NULL, copy = FALSE, + suffix = c(".x", ".y"), ..., + na_matches = pkgconfig::get_config("dplyr::na_matches")) + +# S3 method for tbl_df +full_join(x, y, by = NULL, copy = FALSE, suffix = c(".x", + ".y"), ..., na_matches = pkgconfig::get_config("dplyr::na_matches")) + +# S3 method for tbl_df +semi_join(x, y, by = NULL, copy = FALSE, ..., + na_matches = pkgconfig::get_config("dplyr::na_matches")) + +# S3 method for tbl_df +anti_join(x, y, by = NULL, copy = FALSE, ..., + na_matches = pkgconfig::get_config("dplyr::na_matches"))+ +
x | +tbls to join |
+
---|---|
y | +tbls to join |
+
by | +a character vector of variables to join by. If To join by different variables on x and y use a named vector.
+For example, |
+
copy | +If |
+
suffix | +If there are non-joined duplicate variables in |
+
... | +included for compatibility with the generic; otherwise ignored. |
+
na_matches | +Use |
+
+if (require("Lahman")) { +batting_df <- tbl_df(Batting) +person_df <- tbl_df(Master) + +uperson_df <- tbl_df(Master[!duplicated(Master$playerID), ]) + +# Inner join: match batting and person data +inner_join(batting_df, person_df) +inner_join(batting_df, uperson_df) + +# Left join: match, but preserve batting data +left_join(batting_df, uperson_df) + +# Anti join: find batters without person data +anti_join(batting_df, person_df) +# or people who didn't bat +anti_join(person_df, batting_df) +}#>#>#>#>#>#>#> # A tibble: 187 × 26 +#> playerID birthYear birthMonth birthDay birthCountry birthState birthCity +#> <chr> <int> <int> <int> <chr> <chr> <chr> +#> 1 youngni99 1840 9 12 USA NY Amsterdam +#> 2 wrighal99 1842 3 31 USA NY New York +#> 3 wilsoju99 1896 2 28 USA VA Remington +#> 4 willijo99 1885 4 6 USA TX Seguin +#> 5 williji99 1847 1 4 USA OH Catawba +#> 6 wilkijl99 1878 5 14 USA IA Perry +#> 7 whiteso99 1868 6 12 USA OH Bellaire +#> 8 weissge99 1894 6 23 USA CT New Haven +#> 9 waltzjo99 1860 1 12 USA MD Hagerstown +#> 10 walshmi99 1850 4 29 Ireland <NA> <NA> +#> # ... with 177 more rows, and 19 more variables: deathYear <int>, +#> # deathMonth <int>, deathDay <int>, deathCountry <chr>, deathState <chr>, +#> # deathCity <chr>, nameFirst <chr>, nameLast <chr>, nameGiven <chr>, +#> # weight <int>, height <int>, bats <fctr>, throws <fctr>, debut <chr>, +#> # finalGame <chr>, retroID <chr>, bbrefID <chr>, deathDate <date>, +#> # birthDate <date>
Find the "next" or "previous" values in a vector. Useful for comparing values +ahead of or behind the current values.
+ + +lead(x, n = 1L, default = NA, order_by = NULL, ...) + +lag(x, n = 1L, default = NA, order_by = NULL, ...)+ +
x | +a vector of values |
+
---|---|
n | +a postive integer of length 1, giving the number of positions to +lead or lag by |
+
default | +value used for non-existant rows. Defaults to |
+
order_by | +override the default ordering to use another vector |
+
... | +Needed for compatibility with lag generic. |
+
+lead(1:10, 1)#> [1] 2 3 4 5 6 7 8 9 10 NAlead(1:10, 2)#> [1] 3 4 5 6 7 8 9 10 NA NA+lag(1:10, 1)#> [1] NA 1 2 3 4 5 6 7 8 9lead(1:10, 1)#> [1] 2 3 4 5 6 7 8 9 10 NA+x <- runif(5) +cbind(ahead = lead(x), x, behind = lag(x))#> ahead x behind +#> [1,] 0.3789607 0.6390610 NA +#> [2,] 0.3595307 0.3789607 0.6390610 +#> [3,] 0.8442314 0.3595307 0.3789607 +#> [4,] 0.4567492 0.8442314 0.3595307 +#> [5,] NA 0.4567492 0.8442314+# Use order_by if data not already ordered +df <- data.frame(year = 2000:2005, value = (0:5) ^ 2) +scrambled <- df[sample(nrow(df)), ] + +wrong <- mutate(scrambled, prev = lag(value)) +arrange(wrong, year)#> year value prev +#> 1 2000 0 4 +#> 2 2001 1 NA +#> 3 2002 4 16 +#> 4 2003 9 25 +#> 5 2004 16 1 +#> 6 2005 25 0#> year value prev +#> 1 2000 0 NA +#> 2 2001 1 0 +#> 3 2002 4 1 +#> 4 2003 9 4 +#> 5 2004 16 9 +#> 6 2005 25 16
This is useful for understand how and when dplyr makes copies of data +frames
+ + +location(df) + +changes(x, y)+ +
df | +a data frame |
+
---|---|
x, y | +two data frames to compare |
+
+location(mtcars)#> <0x10ed85aa8> +#> Variables: +#> * mpg: <0x101ad8a30> +#> * cyl: <0x101ad8b60> +#> * disp: <0x101ac9f90> +#> * hp: <0x101aca0c0> +#> * drat: <0x101a85360> +#> * wt: <0x101a85490> +#> * qsec: <0x101a81430> +#> * vs: <0x101a81560> +#> * am: <0x101a809b0> +#> * gear: <0x101a80ae0> +#> * carb: <0x101a5dd90> +#> Attributes: +#> * names: <0x10ed85a00> +#> * row.names: <0x101a5dec0> +#> * class: <0x1108dc688>#> <0x10e761750> +#> Variables: +#> * mpg: <0x101ad8a30> +#> * cyl: <0x101ad8b60> +#> * disp: <0x101ac9f90> +#> * hp: <0x101aca0c0> +#> * drat: <0x101a85360> +#> * wt: <0x101a85490> +#> * qsec: <0x101a81430> +#> * vs: <0x101a81560> +#> * am: <0x101a809b0> +#> * gear: <0x101a80ae0> +#> * carb: <0x101a5dd90> +#> * cyl2: <0x10f2a2410> +#> Attributes: +#> * class: <0x1027e1588> +#> * names: <0x10ed85bf8> +#> * row.names: <0x11028de08>+changes(mtcars, mtcars)#> <identical>changes(mtcars, mtcars2)#> Changed variables: +#> old new +#> cyl2 <added> 0x10f2a2410 +#> +#> Changed attributes: +#> old new +#> names 0x10ed85a00 0x10ed85bf8 +#> row.names 0x101a5dec0 0x10de03a98 +#> class 0x1108dc688 0x1027e1588
tbl()
is the standard constructor for tbls. as.tbl()
coerces,
+and is.tbl()
tests.
make_tbl(subclass, ...)+ +
subclass | +name of subclass. "tbl" is an abstract base class, so you
+must supply this value. |
+
---|---|
... | +For |
+
object | +to test/coerce. |
+
+as.tbl(mtcars)#> # A tibble: 32 × 11 +#> mpg cyl disp hp drat wt qsec vs am gear carb +#> * <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> +#> 1 21.0 6 160.0 110 3.90 2.620 16.46 0 1 4 4 +#> 2 21.0 6 160.0 110 3.90 2.875 17.02 0 1 4 4 +#> 3 22.8 4 108.0 93 3.85 2.320 18.61 1 1 4 1 +#> 4 21.4 6 258.0 110 3.08 3.215 19.44 1 0 3 1 +#> 5 18.7 8 360.0 175 3.15 3.440 17.02 0 0 3 2 +#> 6 18.1 6 225.0 105 2.76 3.460 20.22 1 0 3 1 +#> 7 14.3 8 360.0 245 3.21 3.570 15.84 0 0 3 4 +#> 8 24.4 4 146.7 62 3.69 3.190 20.00 1 0 4 2 +#> 9 22.8 4 140.8 95 3.92 3.150 22.90 1 0 4 2 +#> 10 19.2 6 167.6 123 3.92 3.440 18.30 1 0 4 4 +#> # ... with 22 more rows
mutate()
adds new variables and preserves existing;
+transmute()
drops existing variables.
mutate(.data, ...) + +transmute(.data, ...)+ +
.data | +A tbl. All main verbs are S3 generics and provide methods
+for |
+
---|---|
... | +Name-value pairs of expressions. Use These arguments are automatically quoted and
+evaluated in the context of the data
+frame. They support unquoting and
+splicing. See |
+
An object of the same class as .data
.
+
, -
etc
log()
dense_rank()
, min_rank()
, percent_rank()
, row_number()
,
+cume_dist()
, ntile()
The three scoped variants of mutate()
(mutate_all()
,
+mutate_if()
and mutate_at()
) and the three variants of
+transmute()
(transmute_all()
, transmute_if()
,
+transmute_at()
) make it easy to apply a transformation to a
+selection of variables.
When applied to a data frame, row names are silently dropped. To preserve,
+convert to an explicit variable with tibble::rownames_to_column()
.
Other single table verbs: arrange
,
+ filter
, select
,
+ slice
, summarise
+# Newly created variables are available immediately +mtcars %>% as_tibble() %>% mutate( + cyl2 = cyl * 2, + cyl4 = cyl2 * 2 +)#> # A tibble: 32 × 13 +#> mpg cyl disp hp drat wt qsec vs am gear carb cyl2 +#> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> +#> 1 21.0 6 160.0 110 3.90 2.620 16.46 0 1 4 4 12 +#> 2 21.0 6 160.0 110 3.90 2.875 17.02 0 1 4 4 12 +#> 3 22.8 4 108.0 93 3.85 2.320 18.61 1 1 4 1 8 +#> 4 21.4 6 258.0 110 3.08 3.215 19.44 1 0 3 1 12 +#> 5 18.7 8 360.0 175 3.15 3.440 17.02 0 0 3 2 16 +#> 6 18.1 6 225.0 105 2.76 3.460 20.22 1 0 3 1 12 +#> 7 14.3 8 360.0 245 3.21 3.570 15.84 0 0 3 4 16 +#> 8 24.4 4 146.7 62 3.69 3.190 20.00 1 0 4 2 8 +#> 9 22.8 4 140.8 95 3.92 3.150 22.90 1 0 4 2 8 +#> 10 19.2 6 167.6 123 3.92 3.440 18.30 1 0 4 4 12 +#> # ... with 22 more rows, and 1 more variables: cyl4 <dbl>+# You can also use mutate() to remove variables and +# modify existing variables +mtcars %>% as_tibble() %>% mutate( + mpg = NULL, + disp = disp * 0.0163871 # convert to litres +)#> # A tibble: 32 × 10 +#> cyl disp hp drat wt qsec vs am gear carb +#> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> +#> 1 6 2.621936 110 3.90 2.620 16.46 0 1 4 4 +#> 2 6 2.621936 110 3.90 2.875 17.02 0 1 4 4 +#> 3 4 1.769807 93 3.85 2.320 18.61 1 1 4 1 +#> 4 6 4.227872 110 3.08 3.215 19.44 1 0 3 1 +#> 5 8 5.899356 175 3.15 3.440 17.02 0 0 3 2 +#> 6 6 3.687098 105 2.76 3.460 20.22 1 0 3 1 +#> 7 8 5.899356 245 3.21 3.570 15.84 0 0 3 4 +#> 8 4 2.403988 62 3.69 3.190 20.00 1 0 4 2 +#> 9 4 2.307304 95 3.92 3.150 22.90 1 0 4 2 +#> 10 6 2.746478 123 3.92 3.440 18.30 1 0 4 4 +#> # ... with 22 more rows+ +# window functions are useful for grouped mutates +mtcars %>% + group_by(cyl) %>% + mutate(rank = min_rank(desc(mpg)))#> Source: local data frame [32 x 12] +#> Groups: cyl [3] +#> +#> mpg cyl disp hp drat wt qsec vs am gear carb rank +#> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <int> +#> 1 21.0 6 160.0 110 3.90 2.620 16.46 0 1 4 4 2 +#> 2 21.0 6 160.0 110 3.90 2.875 17.02 0 1 4 4 2 +#> 3 22.8 4 108.0 93 3.85 2.320 18.61 1 1 4 1 8 +#> 4 21.4 6 258.0 110 3.08 3.215 19.44 1 0 3 1 1 +#> 5 18.7 8 360.0 175 3.15 3.440 17.02 0 0 3 2 2 +#> 6 18.1 6 225.0 105 2.76 3.460 20.22 1 0 3 1 6 +#> 7 14.3 8 360.0 245 3.21 3.570 15.84 0 0 3 4 11 +#> 8 24.4 4 146.7 62 3.69 3.190 20.00 1 0 4 2 7 +#> 9 22.8 4 140.8 95 3.92 3.150 22.90 1 0 4 2 8 +#> 10 19.2 6 167.6 123 3.92 3.440 18.30 1 0 4 4 5 +#> # ... with 22 more rows# see `vignette("window-functions")` for more details + +# You can drop variables by setting them to NULL +mtcars %>% mutate(cyl = NULL)#> mpg disp hp drat wt qsec vs am gear carb +#> 1 21.0 160.0 110 3.90 2.620 16.46 0 1 4 4 +#> 2 21.0 160.0 110 3.90 2.875 17.02 0 1 4 4 +#> 3 22.8 108.0 93 3.85 2.320 18.61 1 1 4 1 +#> 4 21.4 258.0 110 3.08 3.215 19.44 1 0 3 1 +#> 5 18.7 360.0 175 3.15 3.440 17.02 0 0 3 2 +#> 6 18.1 225.0 105 2.76 3.460 20.22 1 0 3 1 +#> 7 14.3 360.0 245 3.21 3.570 15.84 0 0 3 4 +#> 8 24.4 146.7 62 3.69 3.190 20.00 1 0 4 2 +#> 9 22.8 140.8 95 3.92 3.150 22.90 1 0 4 2 +#> 10 19.2 167.6 123 3.92 3.440 18.30 1 0 4 4 +#> 11 17.8 167.6 123 3.92 3.440 18.90 1 0 4 4 +#> 12 16.4 275.8 180 3.07 4.070 17.40 0 0 3 3 +#> 13 17.3 275.8 180 3.07 3.730 17.60 0 0 3 3 +#> 14 15.2 275.8 180 3.07 3.780 18.00 0 0 3 3 +#> 15 10.4 472.0 205 2.93 5.250 17.98 0 0 3 4 +#> 16 10.4 460.0 215 3.00 5.424 17.82 0 0 3 4 +#> 17 14.7 440.0 230 3.23 5.345 17.42 0 0 3 4 +#> 18 32.4 78.7 66 4.08 2.200 19.47 1 1 4 1 +#> 19 30.4 75.7 52 4.93 1.615 18.52 1 1 4 2 +#> 20 33.9 71.1 65 4.22 1.835 19.90 1 1 4 1 +#> 21 21.5 120.1 97 3.70 2.465 20.01 1 0 3 1 +#> 22 15.5 318.0 150 2.76 3.520 16.87 0 0 3 2 +#> 23 15.2 304.0 150 3.15 3.435 17.30 0 0 3 2 +#> 24 13.3 350.0 245 3.73 3.840 15.41 0 0 3 4 +#> 25 19.2 400.0 175 3.08 3.845 17.05 0 0 3 2 +#> 26 27.3 79.0 66 4.08 1.935 18.90 1 1 4 1 +#> 27 26.0 120.3 91 4.43 2.140 16.70 0 1 5 2 +#> 28 30.4 95.1 113 3.77 1.513 16.90 1 1 5 2 +#> 29 15.8 351.0 264 4.22 3.170 14.50 0 1 5 4 +#> 30 19.7 145.0 175 3.62 2.770 15.50 0 1 5 6 +#> 31 15.0 301.0 335 3.54 3.570 14.60 0 1 5 8 +#> 32 21.4 121.0 109 4.11 2.780 18.60 1 1 4 2+# mutate() vs transmute -------------------------- +# mutate() keeps all existing variables +mtcars %>% + mutate(displ_l = disp / 61.0237)#> mpg cyl disp hp drat wt qsec vs am gear carb displ_l +#> 1 21.0 6 160.0 110 3.90 2.620 16.46 0 1 4 4 2.621932 +#> 2 21.0 6 160.0 110 3.90 2.875 17.02 0 1 4 4 2.621932 +#> 3 22.8 4 108.0 93 3.85 2.320 18.61 1 1 4 1 1.769804 +#> 4 21.4 6 258.0 110 3.08 3.215 19.44 1 0 3 1 4.227866 +#> 5 18.7 8 360.0 175 3.15 3.440 17.02 0 0 3 2 5.899347 +#> 6 18.1 6 225.0 105 2.76 3.460 20.22 1 0 3 1 3.687092 +#> 7 14.3 8 360.0 245 3.21 3.570 15.84 0 0 3 4 5.899347 +#> 8 24.4 4 146.7 62 3.69 3.190 20.00 1 0 4 2 2.403984 +#> 9 22.8 4 140.8 95 3.92 3.150 22.90 1 0 4 2 2.307300 +#> 10 19.2 6 167.6 123 3.92 3.440 18.30 1 0 4 4 2.746474 +#> 11 17.8 6 167.6 123 3.92 3.440 18.90 1 0 4 4 2.746474 +#> 12 16.4 8 275.8 180 3.07 4.070 17.40 0 0 3 3 4.519556 +#> 13 17.3 8 275.8 180 3.07 3.730 17.60 0 0 3 3 4.519556 +#> 14 15.2 8 275.8 180 3.07 3.780 18.00 0 0 3 3 4.519556 +#> 15 10.4 8 472.0 205 2.93 5.250 17.98 0 0 3 4 7.734700 +#> 16 10.4 8 460.0 215 3.00 5.424 17.82 0 0 3 4 7.538055 +#> 17 14.7 8 440.0 230 3.23 5.345 17.42 0 0 3 4 7.210313 +#> 18 32.4 4 78.7 66 4.08 2.200 19.47 1 1 4 1 1.289663 +#> 19 30.4 4 75.7 52 4.93 1.615 18.52 1 1 4 2 1.240502 +#> 20 33.9 4 71.1 65 4.22 1.835 19.90 1 1 4 1 1.165121 +#> 21 21.5 4 120.1 97 3.70 2.465 20.01 1 0 3 1 1.968088 +#> 22 15.5 8 318.0 150 2.76 3.520 16.87 0 0 3 2 5.211090 +#> 23 15.2 8 304.0 150 3.15 3.435 17.30 0 0 3 2 4.981671 +#> 24 13.3 8 350.0 245 3.73 3.840 15.41 0 0 3 4 5.735477 +#> 25 19.2 8 400.0 175 3.08 3.845 17.05 0 0 3 2 6.554830 +#> 26 27.3 4 79.0 66 4.08 1.935 18.90 1 1 4 1 1.294579 +#> 27 26.0 4 120.3 91 4.43 2.140 16.70 0 1 5 2 1.971365 +#> 28 30.4 4 95.1 113 3.77 1.513 16.90 1 1 5 2 1.558411 +#> 29 15.8 8 351.0 264 4.22 3.170 14.50 0 1 5 4 5.751864 +#> 30 19.7 6 145.0 175 3.62 2.770 15.50 0 1 5 6 2.376126 +#> 31 15.0 8 301.0 335 3.54 3.570 14.60 0 1 5 8 4.932510 +#> 32 21.4 4 121.0 109 4.11 2.780 18.60 1 1 4 2 1.982836+# transmute keeps only the variables you create +mtcars %>% + transmute(displ_l = disp / 61.0237)#> displ_l +#> 1 2.621932 +#> 2 2.621932 +#> 3 1.769804 +#> 4 4.227866 +#> 5 5.899347 +#> 6 3.687092 +#> 7 5.899347 +#> 8 2.403984 +#> 9 2.307300 +#> 10 2.746474 +#> 11 2.746474 +#> 12 4.519556 +#> 13 4.519556 +#> 14 4.519556 +#> 15 7.734700 +#> 16 7.538055 +#> 17 7.210313 +#> 18 1.289663 +#> 19 1.240502 +#> 20 1.165121 +#> 21 1.968088 +#> 22 5.211090 +#> 23 4.981671 +#> 24 5.735477 +#> 25 6.554830 +#> 26 1.294579 +#> 27 1.971365 +#> 28 1.558411 +#> 29 5.751864 +#> 30 2.376126 +#> 31 4.932510 +#> 32 1.982836+
This function is implemented specifically for each data source and can only
+be used from within summarise()
, mutate()
and
+filter()
.
n()
+
+
+ +if (require("nycflights13")) { +carriers <- group_by(flights, carrier) +summarise(carriers, n()) +mutate(carriers, n = n()) +filter(carriers, n() < 100) +}#> Source: local data frame [32 x 19] +#> Groups: carrier [1] +#> +#> year month day dep_time sched_dep_time dep_delay arr_time sched_arr_time +#> <int> <int> <int> <int> <int> <dbl> <int> <int> +#> 1 2013 1 30 1222 1115 67 1402 1215 +#> 2 2013 11 3 1424 1430 -6 1629 1634 +#> 3 2013 11 10 1443 1430 13 1701 1634 +#> 4 2013 11 17 1422 1430 -8 1610 1634 +#> 5 2013 11 25 1803 1759 4 2011 2017 +#> 6 2013 11 30 1648 1647 1 1814 1811 +#> 7 2013 6 15 1626 1635 -9 1810 1830 +#> 8 2013 6 22 1846 1635 131 2107 1830 +#> 9 2013 8 27 1755 1805 -10 1956 1953 +#> 10 2013 8 28 2039 1805 154 2213 1953 +#> # ... with 22 more rows, and 11 more variables: arr_delay <dbl>, carrier <chr>, +#> # flight <int>, tailnum <chr>, origin <chr>, dest <chr>, air_time <dbl>, +#> # distance <dbl>, hour <dbl>, minute <dbl>, time_hour <dttm>
This is a faster and more concise equivalent of length(unique(x))
n_distinct(..., na.rm = FALSE)+ +
… | +vectors of values |
+
---|---|
na.rm | +id |
+
+#> [1] 10n_distinct(x)#> [1] 10
This is a translation of the SQL command NULL_IF
. It is useful
+if you want to convert an annoying value to NA
.
na_if(x, y)+ +
x | +Vector to modify |
+
---|---|
y | +Value to replace with NA |
+
A modified version of x
that replaces any values that
+are equal to y
with NA.
coalesce()
to replace missing values with a specified
+value.
+na_if(1:5, 5:1)#> [1] 1 2 NA 4 5+x <- c(1, -1, 0, 10) +100 / x#> [1] 100 -100 Inf 10100 / na_if(x, 0)#> [1] 100 -100 NA 10+y <- c("abc", "def", "", "ghi") +na_if(y, "")#> [1] "abc" "def" NA "ghi"
This data comes from the ASA 2007 data expo, +http://stat-computing.org/dataexpo/2006/. The data are geographic and +atmospheric measures on a very coarse 24 by 24 grid covering Central +America. The variables are: temperature (surface and air), ozone, +air pressure, and cloud cover (low, mid, and high). All variables are +monthly averages, with observations for Jan 1995 to Dec 2000. These data +were obtained from the NASA Langley Research Center Atmospheric Sciences +Data Center (with permission; see important copyright terms below).
+ + +nasa
+
+ A tbl_cube with 41,472 observations.
+ +lat
, long
: latitude and longitude
year
, month
: month and year
cloudlow
, cloudmed
, cloudhigh
: cloud cover
+at three heights
ozone
surftemp
and temperature
pressure
+nasa#> Source: local array [41,472 x 4] +#> D: lat [dbl, 24] +#> D: long [dbl, 24] +#> D: month [int, 12] +#> D: year [int, 6] +#> M: cloudhigh [dbl] +#> M: cloudlow [dbl] +#> M: cloudmid [dbl] +#> M: ozone [dbl] +#> M: pressure [dbl] +#> M: surftemp [dbl] +#> M: temperature [dbl]
This is a safe way of comparing if two vectors of floating point numbers
+are (pairwise) equal. This is safer than using ==
, because it has
+a built in tolerance
near(x, y, tol = .Machine$double.eps^0.5)+ +
x, y | +Numeric vectors to compare |
+
---|---|
tol | +Tolerance of comparison. |
+
+sqrt(2) ^ 2 == 2#> [1] FALSEnear(sqrt(2) ^ 2, 2)#> [1] TRUE
These are straightforward wrappers around [[
. The main
+advantage is that you can provide an optional secondary vector that defines
+the ordering, and provide a default value to use when the input is shorter
+than expected.
nth(x, n, order_by = NULL, default = default_missing(x)) + +first(x, order_by = NULL, default = default_missing(x)) + +last(x, order_by = NULL, default = default_missing(x))+ +
x | +A vector |
+
---|---|
n | +For If a double is supplied, it will be silently truncated. |
+
order_by | +An optional vector used to determine the order |
+
default | +A default value to use if the position does not exist in
+the input. This is guessed by default for base vectors, where a
+missing value of the appropriate type is returned, and for lists, where
+a For more complicated objects, you'll need to supply this value.
+Make sure it is the same type as |
+
A single value. [[
is used to do the subsetting.
+x <- 1:10 +y <- 10:1 + +first(x)#> [1] 1last(y)#> [1] 1+nth(x, 1)#> [1] 1nth(x, 5)#> [1] 5nth(x, -2)#> [1] 9nth(x, 11)#> [1] NA+last(x)#> [1] 10# Second argument provides optional ordering +last(x, y)#> [1] 1+# These functions always return a single value +first(integer())#> [1] NA
This function makes it possible to control the ordering of window functions +in R that don't have a specific ordering parameter. When translated to SQL +it will modify the order clause of the OVER function.
+ + +order_by(order_by, call)+ +
order_by | +a vector to order_by |
+
---|---|
call | +a function call to a window function, where the first argument +is the vector being operated on |
+
This function works by changing the call
to instead call
+with_order()
with the appropriate arguments.
+order_by(10:1, cumsum(1:10))#> [1] 55 54 52 49 45 40 34 27 19 10x <- 10:1 +y <- 1:10 +order_by(x, cumsum(y))#> [1] 55 54 52 49 45 40 34 27 19 10+df <- data.frame(year = 2000:2005, value = (0:5) ^ 2) +scrambled <- df[sample(nrow(df)), ] + +wrong <- mutate(scrambled, running = cumsum(value)) +arrange(wrong, year)#> year value running +#> 1 2000 0 38 +#> 2 2001 1 55 +#> 3 2002 4 29 +#> 4 2003 9 38 +#> 5 2004 16 54 +#> 6 2005 25 25#> year value running +#> 1 2000 0 0 +#> 2 2001 1 1 +#> 3 2002 4 5 +#> 4 2003 9 14 +#> 5 2004 16 30 +#> 6 2005 25 55
This reference class represents a text progress bar displayed estimated
+time remaining. When finished, it displays the total duration. The
+automatic progress bar can be disabled by setting option
+dplyr.show_progress
to FALSE
.
progress_estimated(n, min_time = 0)+ +
n | +Total number of items |
+
---|---|
min_time | +Progress bar will wait until at least |
+
A ref class with methods tick()
, print()
,
+pause()
, and stop()
.
+p <- progress_estimated(3) +p$tick() +p$tick() +p$tick() + +p <- progress_estimated(3) +for (i in 1:3) p$pause(0.1)$tick()$print()#> |================== | 33% ~0 s remaining |==================================== | 67% ~0 s remaining |======================================================|100% ~0 s remaining+p <- progress_estimated(3) +p$tick()$print()$ + pause(1)$stop()#> Killed after 1 s+# If min_time is set, progress bar not shown until that many +# seconds have elapsed +p <- progress_estimated(3, min_time = 3) +for (i in 1:3) p$pause(0.1)$tick()$print() + +## Not run: ------------------------------------ +# p <- progress_estimated(10, min_time = 3) +# for (i in 1:10) p$pause(0.5)$tick()$print() +## ---------------------------------------------
This works like [[
for local data frames, and automatically collects
+before indexing for remote data tables.
pull(.data, var = -1)+ +
.data | +A table of data |
+
---|---|
var | +A variable specified as:
The default returns the last column (on the assumption that's the +column you've created most recently). |
+
+mtcars %>% pull(-1)#> [1] 4 4 1 1 2 1 4 2 2 4 4 3 3 3 4 4 4 1 2 1 1 2 2 4 2 1 2 2 4 6 8 2mtcars %>% pull(1)#> [1] 21.0 21.0 22.8 21.4 18.7 18.1 14.3 24.4 22.8 19.2 17.8 16.4 17.3 15.2 10.4 +#> [16] 10.4 14.7 32.4 30.4 33.9 21.5 15.5 15.2 13.3 19.2 27.3 26.0 30.4 15.8 19.7 +#> [31] 15.0 21.4mtcars %>% pull("cyl")#> [1] 6 6 4 6 8 6 8 4 4 6 6 8 8 8 8 8 8 4 4 4 4 8 8 8 8 4 4 4 8 6 8 4+# Also works for remote sources +if (requireNamespace("dbplyr", quietly = TRUE)) { +df <- dbplyr::memdb_frame(x = 1:10, y = 10:1, .name = "pull-ex") +df %>% + mutate(z = x * y) %>% + pull() +}#> [1] 10 18 24 28 30 30 28 24 18 10+
Six variations on ranking functions, mimicing the ranking functions
+described in SQL2003. They are currently implemented using the built in
+rank
function, and are provided mainly as a convenience when
+converting between R and SQL. All ranking functions map smallest inputs
+to smallest outputs. Use desc()
to reverse the direction.
row_number(x) + +ntile(x, n) + +min_rank(x) + +dense_rank(x) + +percent_rank(x) + +cume_dist(x)+ +
x | +a vector of values to rank. Missing values are left as is. +If you want to treat them as the smallest or largest values, replace +with Inf or -Inf before ranking. |
+
---|---|
n | +number of groups to split up into. |
+
row_number()
: equivalent to rank(ties.method = "first")
min_rank()
: equivalent to rank(ties.method = "min")
dense_rank()
: like min_rank()
, but with no gaps between
+ranks
percent_rank()
: a number between 0 and 1 computed by
+rescaling min_rank
to [0, 1]
cume_dist()
: a cumulative distribution function. Proportion
+of all values less than or equal to the current rank.
ntile()
: a rough rank, which breaks the input vector into
+n
buckets.
+x <- c(5, 1, 3, 2, 2, NA) +row_number(x)#> [1] 5 1 4 2 3 NAmin_rank(x)#> [1] 5 1 4 2 2 NAdense_rank(x)#> [1] 4 1 3 2 2 NApercent_rank(x)#> [1] 1.00 0.00 0.75 0.25 0.25 NAcume_dist(x)#> [1] 1.0 0.2 0.8 0.6 0.6 NA+ntile(x, 2)#> [1] 2 1 2 1 1 NAntile(runif(100), 10)#> [1] 9 1 4 8 8 9 5 8 10 9 9 3 2 4 7 9 10 5 4 5 4 1 2 8 9 +#> [26] 4 3 6 7 6 10 9 8 4 10 7 10 4 6 7 1 4 6 8 10 8 6 5 1 5 +#> [51] 2 2 10 1 5 10 9 7 8 7 6 2 10 9 9 6 2 1 3 1 10 3 2 3 7 +#> [76] 3 5 7 6 1 1 8 3 5 1 4 7 3 3 3 5 6 8 2 5 2 6 4 2 7+# row_number can be used with single table verbs without specifying x +# (for data frames and databases that support windowing) +mutate(mtcars, row_number() == 1L)#> mpg cyl disp hp drat wt qsec vs am gear carb row_number() == 1L +#> 1 21.0 6 160.0 110 3.90 2.620 16.46 0 1 4 4 TRUE +#> 2 21.0 6 160.0 110 3.90 2.875 17.02 0 1 4 4 FALSE +#> 3 22.8 4 108.0 93 3.85 2.320 18.61 1 1 4 1 FALSE +#> 4 21.4 6 258.0 110 3.08 3.215 19.44 1 0 3 1 FALSE +#> 5 18.7 8 360.0 175 3.15 3.440 17.02 0 0 3 2 FALSE +#> 6 18.1 6 225.0 105 2.76 3.460 20.22 1 0 3 1 FALSE +#> 7 14.3 8 360.0 245 3.21 3.570 15.84 0 0 3 4 FALSE +#> 8 24.4 4 146.7 62 3.69 3.190 20.00 1 0 4 2 FALSE +#> 9 22.8 4 140.8 95 3.92 3.150 22.90 1 0 4 2 FALSE +#> 10 19.2 6 167.6 123 3.92 3.440 18.30 1 0 4 4 FALSE +#> 11 17.8 6 167.6 123 3.92 3.440 18.90 1 0 4 4 FALSE +#> 12 16.4 8 275.8 180 3.07 4.070 17.40 0 0 3 3 FALSE +#> 13 17.3 8 275.8 180 3.07 3.730 17.60 0 0 3 3 FALSE +#> 14 15.2 8 275.8 180 3.07 3.780 18.00 0 0 3 3 FALSE +#> 15 10.4 8 472.0 205 2.93 5.250 17.98 0 0 3 4 FALSE +#> 16 10.4 8 460.0 215 3.00 5.424 17.82 0 0 3 4 FALSE +#> 17 14.7 8 440.0 230 3.23 5.345 17.42 0 0 3 4 FALSE +#> 18 32.4 4 78.7 66 4.08 2.200 19.47 1 1 4 1 FALSE +#> 19 30.4 4 75.7 52 4.93 1.615 18.52 1 1 4 2 FALSE +#> 20 33.9 4 71.1 65 4.22 1.835 19.90 1 1 4 1 FALSE +#> 21 21.5 4 120.1 97 3.70 2.465 20.01 1 0 3 1 FALSE +#> 22 15.5 8 318.0 150 2.76 3.520 16.87 0 0 3 2 FALSE +#> 23 15.2 8 304.0 150 3.15 3.435 17.30 0 0 3 2 FALSE +#> 24 13.3 8 350.0 245 3.73 3.840 15.41 0 0 3 4 FALSE +#> 25 19.2 8 400.0 175 3.08 3.845 17.05 0 0 3 2 FALSE +#> 26 27.3 4 79.0 66 4.08 1.935 18.90 1 1 4 1 FALSE +#> 27 26.0 4 120.3 91 4.43 2.140 16.70 0 1 5 2 FALSE +#> 28 30.4 4 95.1 113 3.77 1.513 16.90 1 1 5 2 FALSE +#> 29 15.8 8 351.0 264 4.22 3.170 14.50 0 1 5 4 FALSE +#> 30 19.7 6 145.0 175 3.62 2.770 15.50 0 1 5 6 FALSE +#> 31 15.0 8 301.0 335 3.54 3.570 14.60 0 1 5 8 FALSE +#> 32 21.4 4 121.0 109 4.11 2.780 18.60 1 1 4 2 FALSE#> mpg cyl disp hp drat wt qsec vs am gear carb +#> 1 21.0 6 160.0 110 3.90 2.620 16.46 0 1 4 4 +#> 2 21.0 6 160.0 110 3.90 2.875 17.02 0 1 4 4 +#> 3 22.8 4 108.0 93 3.85 2.320 18.61 1 1 4 1 +#> 4 21.4 6 258.0 110 3.08 3.215 19.44 1 0 3 1 +#> 5 18.7 8 360.0 175 3.15 3.440 17.02 0 0 3 2 +#> 6 18.1 6 225.0 105 2.76 3.460 20.22 1 0 3 1 +#> 7 14.3 8 360.0 245 3.21 3.570 15.84 0 0 3 4 +#> 8 24.4 4 146.7 62 3.69 3.190 20.00 1 0 4 2 +#> 9 22.8 4 140.8 95 3.92 3.150 22.90 1 0 4 2 +#> 10 19.2 6 167.6 123 3.92 3.440 18.30 1 0 4 4
This is a vectorised version of switch()
: you can replace
+numeric values based on their position, and character values by their
+name. This is an S3 generic: dplyr provides methods for numeric, character,
+and factors. For logical vectors, use if_else()
. For more complicated
+criteria, use case_when()
.
recode(.x, ..., .default = NULL, .missing = NULL) + +recode_factor(.x, ..., .default = NULL, .missing = NULL, .ordered = FALSE)+ +
.x | +A vector to modify |
+
---|---|
... | +Replacements. These should be named for character and factor
+ All replacements must be the same type, and must have either +length one or the same length as x. +These dots are evaluated with explicit splicing. |
+
.default | +If supplied, all values not otherwise matched will
+be given this value. If not supplied and if the replacements are
+the same type as the original values in |
+
.missing | +If supplied, any missing values in |
+
.ordered | +If |
+
A vector the same length as .x
, and the same type as
+the first of ...
, .default
, or .missing
.
+recode_factor()
returns a factor whose levels are in the
+same order as in ...
.
You can use recode()
directly with factors; it will preserve the existing
+order of levels while changing the values. Alternatively, you can
+use recode_factor()
, which will change the order of levels to match
+the order of replacements. See the forcats
+package for more tools for working with factors and their levels.
+# Recode values with named arguments +x <- sample(c("a", "b", "c"), 10, replace = TRUE) +recode(x, a = "Apple")#> [1] "b" "b" "Apple" "c" "c" "Apple" "c" "c" "Apple" +#> [10] "c"recode(x, a = "Apple", .default = NA_character_)#> [1] NA NA "Apple" NA NA "Apple" NA NA "Apple" +#> [10] NA+# Named arguments also work with numeric values +x <- c(1:5, NA) +recode(x, `2` = 20L, `4` = 40L)#> [1] 1 20 3 40 5 NA+# Note that if the replacements are not compatible with .x, +# unmatched values are replaced by NA and a warning is issued. +recode(x, `2` = "b", `4` = "d")#> Warning: Unreplaced values treated as NA as .x is not compatible. Please specify replacements exhaustively or supply .default#> [1] NA "b" NA "d" NA NA+# If you don't name the arguments, recode() matches by position +recode(x, "a", "b", "c")#> Warning: Unreplaced values treated as NA as .x is not compatible. Please specify replacements exhaustively or supply .default#> [1] "a" "b" "c" NA NA NArecode(x, "a", "b", "c", .default = "other")#> [1] "a" "b" "c" "other" "other" NArecode(x, "a", "b", "c", .default = "other", .missing = "missing")#> [1] "a" "b" "c" "other" "other" "missing"+# Supply default with levels() for factors +x <- factor(c("a", "b", "c")) +recode(x, a = "Apple", .default = levels(x))#> [1] Apple b c +#> Levels: Apple b c+# Use recode_factor() to create factors with levels ordered as they +# appear in the recode call. The levels in .default and .missing +# come last. +x <- c(1:4, NA) +recode_factor(x, `1` = "z", `2` = "y", `3` = "x")#> Warning: Unreplaced values treated as NA as .x is not compatible. Please specify replacements exhaustively or supply .default#> [1] z y x <NA> <NA> +#> Levels: z y xrecode_factor(x, `1` = "z", `2` = "y", .default = "D")#> [1] z y D D <NA> +#> Levels: z y Drecode_factor(x, `1` = "z", `2` = "y", .default = "D", .missing = "M")#> [1] z y D D M +#> Levels: z y D M+# When the input vector is a compatible vector (character vector or +# factor), it is reused as default. +recode_factor(letters[1:3], b = "z", c = "y")#> [1] a z y +#> Levels: z y arecode_factor(factor(letters[1:3]), b = "z", c = "y")#> [1] a z y +#> Levels: z y a
These objects are imported from other packages. Follow the links +below to see their documentation.
%>%
data_frame
, data_frame_
, as_data_frame
, lst
, lst_
, add_row
, type_sum
, glimpse
, frame_data
, tribble
, tibble
, as_tibble
, trunc_mat
rowwise()
is used for the results of do()
when you
+create list-variables. It is also useful to support arbitrary
+complex operations that need to be applied to each row.
rowwise(data)+ +
data | +Input data frame. |
+
---|
Currently, rowwise grouping only works with data frames. Its
+main impact is to allow you to work with list-variables in
+summarise()
and mutate()
without having to
+use [[1]]
. This makes summarise()
on a rowwise tbl
+effectively equivalent to [plyr::ldply()].
[[1]: R:[1 +[plyr::ldply()]: R:plyr::ldply()
+ + ++#> Source: local data frame [9 x 1] +#> Groups: <by row> +#> +#> # A tibble: 9 × 1 +#> i +#> * <list> +#> 1 <int [3]> +#> 2 <int [2]> +#> 3 <int [1]> +#> 4 <int [2]> +#> 5 <int [1]> +#> 6 <int [2]> +#> 7 <int [1]> +#> 8 <int [2]> +#> 9 <int [3]>#> Error in UseMethod("summarise_"): no applicable method for 'summarise_' applied to an object of class "function"
This is a wrapper around sample.int()
to make it easy to
+select random rows from a table. It currently only works for local
+tbls.
sample_n(tbl, size, replace = FALSE, weight = NULL, .env = NULL) + +sample_frac(tbl, size = 1, replace = FALSE, weight = NULL, .env = NULL)+ +
tbl | +tbl of data. |
+
---|---|
size | +For |
+
replace | +Sample with or without replacement? |
+
weight | +Sampling weights. This must evaluate to a vector of +non-negative numbers the same length as the input. Weights are +automatically standardised to sum to 1. +This argument is automatically quoted and later
+evaluated in the context of the data
+frame. It supports unquoting. See
+ |
+
.env | +This variable is deprecated and no longer has any
+effect. To evaluate |
+
+#> mpg cyl disp hp drat wt qsec vs am gear carb +#> Cadillac Fleetwood 10.4 8 472.0 205 2.93 5.250 17.98 0 0 3 4 +#> Mazda RX4 21.0 6 160.0 110 3.90 2.620 16.46 0 1 4 4 +#> Porsche 914-2 26.0 4 120.3 91 4.43 2.140 16.70 0 1 5 2 +#> Camaro Z28 13.3 8 350.0 245 3.73 3.840 15.41 0 0 3 4 +#> Merc 280C 17.8 6 167.6 123 3.92 3.440 18.90 1 0 4 4 +#> Maserati Bora 15.0 8 301.0 335 3.54 3.570 14.60 0 1 5 8 +#> Dodge Challenger 15.5 8 318.0 150 2.76 3.520 16.87 0 0 3 2 +#> Chrysler Imperial 14.7 8 440.0 230 3.23 5.345 17.42 0 0 3 4 +#> Pontiac Firebird 19.2 8 400.0 175 3.08 3.845 17.05 0 0 3 2 +#> Merc 230 22.8 4 140.8 95 3.92 3.150 22.90 1 0 4 2sample_n(mtcars, 50, replace = TRUE)#> mpg cyl disp hp drat wt qsec vs am gear carb +#> Valiant 18.1 6 225.0 105 2.76 3.460 20.22 1 0 3 1 +#> Lotus Europa 30.4 4 95.1 113 3.77 1.513 16.90 1 1 5 2 +#> Chrysler Imperial 14.7 8 440.0 230 3.23 5.345 17.42 0 0 3 4 +#> Merc 450SL 17.3 8 275.8 180 3.07 3.730 17.60 0 0 3 3 +#> Merc 280C 17.8 6 167.6 123 3.92 3.440 18.90 1 0 4 4 +#> Toyota Corona 21.5 4 120.1 97 3.70 2.465 20.01 1 0 3 1 +#> Hornet Sportabout 18.7 8 360.0 175 3.15 3.440 17.02 0 0 3 2 +#> Merc 450SLC 15.2 8 275.8 180 3.07 3.780 18.00 0 0 3 3 +#> Merc 230 22.8 4 140.8 95 3.92 3.150 22.90 1 0 4 2 +#> Honda Civic 30.4 4 75.7 52 4.93 1.615 18.52 1 1 4 2 +#> Hornet 4 Drive 21.4 6 258.0 110 3.08 3.215 19.44 1 0 3 1 +#> Merc 280C.1 17.8 6 167.6 123 3.92 3.440 18.90 1 0 4 4 +#> AMC Javelin 15.2 8 304.0 150 3.15 3.435 17.30 0 0 3 2 +#> Merc 280C.2 17.8 6 167.6 123 3.92 3.440 18.90 1 0 4 4 +#> Chrysler Imperial.1 14.7 8 440.0 230 3.23 5.345 17.42 0 0 3 4 +#> Porsche 914-2 26.0 4 120.3 91 4.43 2.140 16.70 0 1 5 2 +#> Lincoln Continental 10.4 8 460.0 215 3.00 5.424 17.82 0 0 3 4 +#> Merc 450SE 16.4 8 275.8 180 3.07 4.070 17.40 0 0 3 3 +#> Merc 230.1 22.8 4 140.8 95 3.92 3.150 22.90 1 0 4 2 +#> Cadillac Fleetwood 10.4 8 472.0 205 2.93 5.250 17.98 0 0 3 4 +#> Lincoln Continental.1 10.4 8 460.0 215 3.00 5.424 17.82 0 0 3 4 +#> Ford Pantera L 15.8 8 351.0 264 4.22 3.170 14.50 0 1 5 4 +#> Lotus Europa.1 30.4 4 95.1 113 3.77 1.513 16.90 1 1 5 2 +#> Merc 240D 24.4 4 146.7 62 3.69 3.190 20.00 1 0 4 2 +#> Lotus Europa.2 30.4 4 95.1 113 3.77 1.513 16.90 1 1 5 2 +#> Toyota Corona.1 21.5 4 120.1 97 3.70 2.465 20.01 1 0 3 1 +#> Merc 280C.3 17.8 6 167.6 123 3.92 3.440 18.90 1 0 4 4 +#> Toyota Corona.2 21.5 4 120.1 97 3.70 2.465 20.01 1 0 3 1 +#> Dodge Challenger 15.5 8 318.0 150 2.76 3.520 16.87 0 0 3 2 +#> Merc 450SL.1 17.3 8 275.8 180 3.07 3.730 17.60 0 0 3 3 +#> Lotus Europa.3 30.4 4 95.1 113 3.77 1.513 16.90 1 1 5 2 +#> Fiat 128 32.4 4 78.7 66 4.08 2.200 19.47 1 1 4 1 +#> Camaro Z28 13.3 8 350.0 245 3.73 3.840 15.41 0 0 3 4 +#> Volvo 142E 21.4 4 121.0 109 4.11 2.780 18.60 1 1 4 2 +#> Merc 450SLC.1 15.2 8 275.8 180 3.07 3.780 18.00 0 0 3 3 +#> Volvo 142E.1 21.4 4 121.0 109 4.11 2.780 18.60 1 1 4 2 +#> Merc 280C.4 17.8 6 167.6 123 3.92 3.440 18.90 1 0 4 4 +#> Ford Pantera L.1 15.8 8 351.0 264 4.22 3.170 14.50 0 1 5 4 +#> Duster 360 14.3 8 360.0 245 3.21 3.570 15.84 0 0 3 4 +#> Datsun 710 22.8 4 108.0 93 3.85 2.320 18.61 1 1 4 1 +#> Toyota Corona.3 21.5 4 120.1 97 3.70 2.465 20.01 1 0 3 1 +#> Merc 450SLC.2 15.2 8 275.8 180 3.07 3.780 18.00 0 0 3 3 +#> Cadillac Fleetwood.1 10.4 8 472.0 205 2.93 5.250 17.98 0 0 3 4 +#> Valiant.1 18.1 6 225.0 105 2.76 3.460 20.22 1 0 3 1 +#> Fiat X1-9 27.3 4 79.0 66 4.08 1.935 18.90 1 1 4 1 +#> Fiat X1-9.1 27.3 4 79.0 66 4.08 1.935 18.90 1 1 4 1 +#> Duster 360.1 14.3 8 360.0 245 3.21 3.570 15.84 0 0 3 4 +#> Hornet 4 Drive.1 21.4 6 258.0 110 3.08 3.215 19.44 1 0 3 1 +#> Lincoln Continental.2 10.4 8 460.0 215 3.00 5.424 17.82 0 0 3 4 +#> Merc 240D.1 24.4 4 146.7 62 3.69 3.190 20.00 1 0 4 2sample_n(mtcars, 10, weight = mpg)#> mpg cyl disp hp drat wt qsec vs am gear carb +#> Lotus Europa 30.4 4 95.1 113 3.77 1.513 16.90 1 1 5 2 +#> Pontiac Firebird 19.2 8 400.0 175 3.08 3.845 17.05 0 0 3 2 +#> Mazda RX4 Wag 21.0 6 160.0 110 3.90 2.875 17.02 0 1 4 4 +#> Honda Civic 30.4 4 75.7 52 4.93 1.615 18.52 1 1 4 2 +#> Fiat 128 32.4 4 78.7 66 4.08 2.200 19.47 1 1 4 1 +#> Merc 450SL 17.3 8 275.8 180 3.07 3.730 17.60 0 0 3 3 +#> Maserati Bora 15.0 8 301.0 335 3.54 3.570 14.60 0 1 5 8 +#> Porsche 914-2 26.0 4 120.3 91 4.43 2.140 16.70 0 1 5 2 +#> Merc 280 19.2 6 167.6 123 3.92 3.440 18.30 1 0 4 4 +#> Ferrari Dino 19.7 6 145.0 175 3.62 2.770 15.50 0 1 5 6+sample_n(by_cyl, 3)#> Source: local data frame [9 x 11] +#> Groups: cyl [3] +#> +#> mpg cyl disp hp drat wt qsec vs am gear carb +#> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> +#> 1 22.8 4 140.8 95 3.92 3.150 22.90 1 0 4 2 +#> 2 22.8 4 108.0 93 3.85 2.320 18.61 1 1 4 1 +#> 3 30.4 4 95.1 113 3.77 1.513 16.90 1 1 5 2 +#> 4 17.8 6 167.6 123 3.92 3.440 18.90 1 0 4 4 +#> 5 19.2 6 167.6 123 3.92 3.440 18.30 1 0 4 4 +#> 6 21.0 6 160.0 110 3.90 2.620 16.46 0 1 4 4 +#> 7 10.4 8 472.0 205 2.93 5.250 17.98 0 0 3 4 +#> 8 18.7 8 360.0 175 3.15 3.440 17.02 0 0 3 2 +#> 9 13.3 8 350.0 245 3.73 3.840 15.41 0 0 3 4sample_n(by_cyl, 10, replace = TRUE)#> Source: local data frame [30 x 11] +#> Groups: cyl [3] +#> +#> mpg cyl disp hp drat wt qsec vs am gear carb +#> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> +#> 1 22.8 4 140.8 95 3.92 3.150 22.90 1 0 4 2 +#> 2 27.3 4 79.0 66 4.08 1.935 18.90 1 1 4 1 +#> 3 30.4 4 75.7 52 4.93 1.615 18.52 1 1 4 2 +#> 4 27.3 4 79.0 66 4.08 1.935 18.90 1 1 4 1 +#> 5 32.4 4 78.7 66 4.08 2.200 19.47 1 1 4 1 +#> 6 30.4 4 95.1 113 3.77 1.513 16.90 1 1 5 2 +#> 7 22.8 4 140.8 95 3.92 3.150 22.90 1 0 4 2 +#> 8 22.8 4 140.8 95 3.92 3.150 22.90 1 0 4 2 +#> 9 32.4 4 78.7 66 4.08 2.200 19.47 1 1 4 1 +#> 10 32.4 4 78.7 66 4.08 2.200 19.47 1 1 4 1 +#> # ... with 20 more rowssample_n(by_cyl, 3, weight = mpg / mean(mpg))#> Source: local data frame [9 x 11] +#> Groups: cyl [3] +#> +#> mpg cyl disp hp drat wt qsec vs am gear carb +#> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> +#> 1 22.8 4 140.8 95 3.92 3.150 22.90 1 0 4 2 +#> 2 27.3 4 79.0 66 4.08 1.935 18.90 1 1 4 1 +#> 3 21.5 4 120.1 97 3.70 2.465 20.01 1 0 3 1 +#> 4 21.0 6 160.0 110 3.90 2.620 16.46 0 1 4 4 +#> 5 17.8 6 167.6 123 3.92 3.440 18.90 1 0 4 4 +#> 6 21.4 6 258.0 110 3.08 3.215 19.44 1 0 3 1 +#> 7 15.8 8 351.0 264 4.22 3.170 14.50 0 1 5 4 +#> 8 14.7 8 440.0 230 3.23 5.345 17.42 0 0 3 4 +#> 9 16.4 8 275.8 180 3.07 4.070 17.40 0 0 3 3+# Sample fixed fraction per group +# Default is to sample all data = randomly resample rows +sample_frac(mtcars)#> mpg cyl disp hp drat wt qsec vs am gear carb +#> Merc 280 19.2 6 167.6 123 3.92 3.440 18.30 1 0 4 4 +#> Fiat 128 32.4 4 78.7 66 4.08 2.200 19.47 1 1 4 1 +#> Merc 230 22.8 4 140.8 95 3.92 3.150 22.90 1 0 4 2 +#> Dodge Challenger 15.5 8 318.0 150 2.76 3.520 16.87 0 0 3 2 +#> Porsche 914-2 26.0 4 120.3 91 4.43 2.140 16.70 0 1 5 2 +#> Fiat X1-9 27.3 4 79.0 66 4.08 1.935 18.90 1 1 4 1 +#> Camaro Z28 13.3 8 350.0 245 3.73 3.840 15.41 0 0 3 4 +#> Chrysler Imperial 14.7 8 440.0 230 3.23 5.345 17.42 0 0 3 4 +#> Volvo 142E 21.4 4 121.0 109 4.11 2.780 18.60 1 1 4 2 +#> Duster 360 14.3 8 360.0 245 3.21 3.570 15.84 0 0 3 4 +#> Toyota Corona 21.5 4 120.1 97 3.70 2.465 20.01 1 0 3 1 +#> Toyota Corolla 33.9 4 71.1 65 4.22 1.835 19.90 1 1 4 1 +#> Mazda RX4 21.0 6 160.0 110 3.90 2.620 16.46 0 1 4 4 +#> Merc 450SLC 15.2 8 275.8 180 3.07 3.780 18.00 0 0 3 3 +#> Merc 450SL 17.3 8 275.8 180 3.07 3.730 17.60 0 0 3 3 +#> Merc 240D 24.4 4 146.7 62 3.69 3.190 20.00 1 0 4 2 +#> Lotus Europa 30.4 4 95.1 113 3.77 1.513 16.90 1 1 5 2 +#> Hornet 4 Drive 21.4 6 258.0 110 3.08 3.215 19.44 1 0 3 1 +#> Ford Pantera L 15.8 8 351.0 264 4.22 3.170 14.50 0 1 5 4 +#> Honda Civic 30.4 4 75.7 52 4.93 1.615 18.52 1 1 4 2 +#> Hornet Sportabout 18.7 8 360.0 175 3.15 3.440 17.02 0 0 3 2 +#> AMC Javelin 15.2 8 304.0 150 3.15 3.435 17.30 0 0 3 2 +#> Mazda RX4 Wag 21.0 6 160.0 110 3.90 2.875 17.02 0 1 4 4 +#> Maserati Bora 15.0 8 301.0 335 3.54 3.570 14.60 0 1 5 8 +#> Valiant 18.1 6 225.0 105 2.76 3.460 20.22 1 0 3 1 +#> Ferrari Dino 19.7 6 145.0 175 3.62 2.770 15.50 0 1 5 6 +#> Datsun 710 22.8 4 108.0 93 3.85 2.320 18.61 1 1 4 1 +#> Merc 450SE 16.4 8 275.8 180 3.07 4.070 17.40 0 0 3 3 +#> Merc 280C 17.8 6 167.6 123 3.92 3.440 18.90 1 0 4 4 +#> Pontiac Firebird 19.2 8 400.0 175 3.08 3.845 17.05 0 0 3 2 +#> Cadillac Fleetwood 10.4 8 472.0 205 2.93 5.250 17.98 0 0 3 4 +#> Lincoln Continental 10.4 8 460.0 215 3.00 5.424 17.82 0 0 3 4+sample_frac(mtcars, 0.1)#> mpg cyl disp hp drat wt qsec vs am gear carb +#> Ford Pantera L 15.8 8 351.0 264 4.22 3.170 14.50 0 1 5 4 +#> Honda Civic 30.4 4 75.7 52 4.93 1.615 18.52 1 1 4 2 +#> Pontiac Firebird 19.2 8 400.0 175 3.08 3.845 17.05 0 0 3 2sample_frac(mtcars, 1.5, replace = TRUE)#> mpg cyl disp hp drat wt qsec vs am gear carb +#> Pontiac Firebird 19.2 8 400.0 175 3.08 3.845 17.05 0 0 3 2 +#> AMC Javelin 15.2 8 304.0 150 3.15 3.435 17.30 0 0 3 2 +#> Ford Pantera L 15.8 8 351.0 264 4.22 3.170 14.50 0 1 5 4 +#> Merc 280C 17.8 6 167.6 123 3.92 3.440 18.90 1 0 4 4 +#> Porsche 914-2 26.0 4 120.3 91 4.43 2.140 16.70 0 1 5 2 +#> Ferrari Dino 19.7 6 145.0 175 3.62 2.770 15.50 0 1 5 6 +#> Fiat 128 32.4 4 78.7 66 4.08 2.200 19.47 1 1 4 1 +#> Merc 450SL 17.3 8 275.8 180 3.07 3.730 17.60 0 0 3 3 +#> Hornet Sportabout 18.7 8 360.0 175 3.15 3.440 17.02 0 0 3 2 +#> Mazda RX4 21.0 6 160.0 110 3.90 2.620 16.46 0 1 4 4 +#> Toyota Corona 21.5 4 120.1 97 3.70 2.465 20.01 1 0 3 1 +#> Ford Pantera L.1 15.8 8 351.0 264 4.22 3.170 14.50 0 1 5 4 +#> Merc 240D 24.4 4 146.7 62 3.69 3.190 20.00 1 0 4 2 +#> Duster 360 14.3 8 360.0 245 3.21 3.570 15.84 0 0 3 4 +#> Toyota Corona.1 21.5 4 120.1 97 3.70 2.465 20.01 1 0 3 1 +#> Merc 450SL.1 17.3 8 275.8 180 3.07 3.730 17.60 0 0 3 3 +#> Honda Civic 30.4 4 75.7 52 4.93 1.615 18.52 1 1 4 2 +#> Hornet Sportabout.1 18.7 8 360.0 175 3.15 3.440 17.02 0 0 3 2 +#> Merc 450SLC 15.2 8 275.8 180 3.07 3.780 18.00 0 0 3 3 +#> Fiat 128.1 32.4 4 78.7 66 4.08 2.200 19.47 1 1 4 1 +#> Merc 240D.1 24.4 4 146.7 62 3.69 3.190 20.00 1 0 4 2 +#> Lincoln Continental 10.4 8 460.0 215 3.00 5.424 17.82 0 0 3 4 +#> Datsun 710 22.8 4 108.0 93 3.85 2.320 18.61 1 1 4 1 +#> Merc 280 19.2 6 167.6 123 3.92 3.440 18.30 1 0 4 4 +#> Chrysler Imperial 14.7 8 440.0 230 3.23 5.345 17.42 0 0 3 4 +#> Datsun 710.1 22.8 4 108.0 93 3.85 2.320 18.61 1 1 4 1 +#> Mazda RX4 Wag 21.0 6 160.0 110 3.90 2.875 17.02 0 1 4 4 +#> Merc 450SL.2 17.3 8 275.8 180 3.07 3.730 17.60 0 0 3 3 +#> Hornet Sportabout.2 18.7 8 360.0 175 3.15 3.440 17.02 0 0 3 2 +#> Hornet Sportabout.3 18.7 8 360.0 175 3.15 3.440 17.02 0 0 3 2 +#> Merc 450SL.3 17.3 8 275.8 180 3.07 3.730 17.60 0 0 3 3 +#> Lotus Europa 30.4 4 95.1 113 3.77 1.513 16.90 1 1 5 2 +#> Hornet 4 Drive 21.4 6 258.0 110 3.08 3.215 19.44 1 0 3 1 +#> Hornet 4 Drive.1 21.4 6 258.0 110 3.08 3.215 19.44 1 0 3 1 +#> Hornet Sportabout.4 18.7 8 360.0 175 3.15 3.440 17.02 0 0 3 2 +#> Porsche 914-2.1 26.0 4 120.3 91 4.43 2.140 16.70 0 1 5 2 +#> Hornet Sportabout.5 18.7 8 360.0 175 3.15 3.440 17.02 0 0 3 2 +#> Merc 230 22.8 4 140.8 95 3.92 3.150 22.90 1 0 4 2 +#> AMC Javelin.1 15.2 8 304.0 150 3.15 3.435 17.30 0 0 3 2 +#> Ferrari Dino.1 19.7 6 145.0 175 3.62 2.770 15.50 0 1 5 6 +#> Cadillac Fleetwood 10.4 8 472.0 205 2.93 5.250 17.98 0 0 3 4 +#> Lotus Europa.1 30.4 4 95.1 113 3.77 1.513 16.90 1 1 5 2 +#> Merc 450SLC.1 15.2 8 275.8 180 3.07 3.780 18.00 0 0 3 3 +#> Fiat 128.2 32.4 4 78.7 66 4.08 2.200 19.47 1 1 4 1 +#> Maserati Bora 15.0 8 301.0 335 3.54 3.570 14.60 0 1 5 8 +#> Dodge Challenger 15.5 8 318.0 150 2.76 3.520 16.87 0 0 3 2 +#> Mazda RX4 Wag.1 21.0 6 160.0 110 3.90 2.875 17.02 0 1 4 4 +#> Merc 240D.2 24.4 4 146.7 62 3.69 3.190 20.00 1 0 4 2sample_frac(mtcars, 0.1, weight = 1 / mpg)#> mpg cyl disp hp drat wt qsec vs am gear carb +#> Volvo 142E 21.4 4 121.0 109 4.11 2.78 18.6 1 1 4 2 +#> Merc 240D 24.4 4 146.7 62 3.69 3.19 20.0 1 0 4 2 +#> Merc 450SE 16.4 8 275.8 180 3.07 4.07 17.4 0 0 3 3+sample_frac(by_cyl, 0.2)#> Source: local data frame [6 x 11] +#> Groups: cyl [3] +#> +#> mpg cyl disp hp drat wt qsec vs am gear carb +#> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> +#> 1 21.5 4 120.1 97 3.70 2.465 20.01 1 0 3 1 +#> 2 26.0 4 120.3 91 4.43 2.140 16.70 0 1 5 2 +#> 3 21.4 6 258.0 110 3.08 3.215 19.44 1 0 3 1 +#> 4 10.4 8 460.0 215 3.00 5.424 17.82 0 0 3 4 +#> 5 10.4 8 472.0 205 2.93 5.250 17.98 0 0 3 4 +#> 6 16.4 8 275.8 180 3.07 4.070 17.40 0 0 3 3sample_frac(by_cyl, 1, replace = TRUE)#> Source: local data frame [32 x 11] +#> Groups: cyl [3] +#> +#> mpg cyl disp hp drat wt qsec vs am gear carb +#> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> +#> 1 26.0 4 120.3 91 4.43 2.140 16.70 0 1 5 2 +#> 2 27.3 4 79.0 66 4.08 1.935 18.90 1 1 4 1 +#> 3 30.4 4 95.1 113 3.77 1.513 16.90 1 1 5 2 +#> 4 33.9 4 71.1 65 4.22 1.835 19.90 1 1 4 1 +#> 5 30.4 4 75.7 52 4.93 1.615 18.52 1 1 4 2 +#> 6 21.4 4 121.0 109 4.11 2.780 18.60 1 1 4 2 +#> 7 30.4 4 75.7 52 4.93 1.615 18.52 1 1 4 2 +#> 8 33.9 4 71.1 65 4.22 1.835 19.90 1 1 4 1 +#> 9 21.5 4 120.1 97 3.70 2.465 20.01 1 0 3 1 +#> 10 30.4 4 95.1 113 3.77 1.513 16.90 1 1 5 2 +#> # ... with 22 more rows
The variants suffixed with _if
, _at
or _all
apply an
+expression (sometimes several) to all variables within a specified
+subset. This subset can contain all variables (_all
variants), a
+vars()
selection (_at
variants), or variables selected with a
+predicate (_if
variants).
.tbl | +A |
+
---|---|
.funs | +List of function calls generated by |
+
.vars | +A list of columns generated by |
+
.predicate | +A predicate function to be applied to the columns
+or a logical vector. The variables for which |
+
... | +Additional arguments for the function calls in
+ |
+
The verbs with scoped variants are:
mutate()
, transmute()
and summarise()
. See summarise_all()
.
filter()
. See filter_all()
.
group_by()
. See group_by_all()
.
rename()
and select()
. See select_all()
.
There are three kinds of scoped variants. They differ in the scope +of the variable selection on which operations are applied:
Verbs suffixed with _all()
apply an operation on all variables.
Verbs suffixed with _at()
apply an operation on a subset of
+variables specified with the quoting function vars()
. This
+quoting function accepts select_vars()
helpers like
+starts_with()
. Instead of a vars()
selection, you can also
+supply an integerish vector of column
+positions or a character vector of column names.
Verbs suffixed with _if()
apply an operation on the subset of
+variables for which a predicate function returns TRUE
. Instead
+of a predicate function, you can also supply a logical vector.
dplyr used to offer twin versions of each verb suffixed with an +underscore. These versions had standard evaluation (SE) semantics: +rather than taking arguments by code, like NSE verbs, they took +arguments by value. Their purpose was to make it possible to +program with dplyr. However, dplyr now uses tidy evaluation +semantics. NSE verbs still capture their arguments, but you can now +unquote parts of these arguments. This offers full programmability +with NSE verbs. Thus, the underscored versions are now superfluous.
+ + +tally_(x, wt, sort = FALSE) + +count_(x, vars, wt = NULL, sort = FALSE) + +add_tally_(x, wt, sort = FALSE) + +add_count_(x, vars, wt = NULL, sort = FALSE) + +distinct_(.data, ..., .dots, .keep_all = FALSE) + +do_(.data, ..., .dots = list()) + +funs_(dots, args = list(), env = base_env()) + +group_by_(.data, ..., .dots = list(), add = FALSE) + +group_indices_(.data, ..., .dots = list()) + +filter_(.data, ..., .dots = list()) + +slice_(.data, ..., .dots = list()) + +summarise_(.data, ..., .dots = list()) + +summarize_(.data, ..., .dots = list()) + +mutate_(.data, ..., .dots = list()) + +transmute_(.data, ..., .dots = list()) + +arrange_(.data, ..., .dots = list()) + +select_(.data, ..., .dots = list()) + +rename_(.data, ..., .dots = list()) + +select_vars_(vars, args, include = character(), exclude = character()) + +rename_vars_(vars, args)+ +
x | +a |
+
---|---|
wt | +(Optional) If omitted, will count the number of rows. If
+specified, will perform a "weighted" tally by summing the
+(non-missing) values of variable |
+
sort | +if |
+
vars | +Various meanings depending on the verb. |
+
.data | +A data frame. |
+
.keep_all | +If |
+
dots, .dots, ... | +Pair/values of expressions coercible to lazy objects. |
+
args | +Various meanings depending on the verb. |
+
env | +The environment in which functions should be evaluated. |
+
add | +When |
+
include | +Character vector of column names to always +include/exclude. |
+
exclude | +Character vector of column names to always +include/exclude. |
+
Unquoting triggers immediate evaluation of its operand and inlines
+the result within the captured expression. This result can be a
+value or an expression to be evaluated later with the rest of the
+argument. See vignette("programming")
for more information.
select()
keeps only the variables you mention; rename()
+keeps all variables.
select(.data, ...) + +rename(.data, ...)+ +
.data | +A tbl. All main verbs are S3 generics and provide methods
+for |
+
---|---|
... | +One or more unquoted expressions separated by commas. +You can treat variable names like they are positions. +Positive values select variables; negative values to drop variables. +Use named arguments to rename selected variables. +These arguments are automatically quoted and
+evaluated in a context where column names
+represent column positions. They support
+unquoting and splicing. See
+ |
+
An object of the same class as .data
.
As well as using existing functions like :
and c()
, there are
+a number of special functions that only work inside select
To drop variables, use -
.
The three scoped variants of select()
(select_all()
,
+select_if()
and select_at()
) and the three variants of
+rename()
(rename_all()
, rename_if()
, rename_at()
) make it
+easy to apply a renaming function to a selection of variables.
When applied to a data frame, row names are silently dropped. To preserve,
+convert to an explicit variable with tibble::rownames_to_column()
.
Other single table verbs: arrange
,
+ filter
, mutate
,
+ slice
, summarise
+#> # A tibble: 150 × 2 +#> Petal.Length Petal.Width +#> <dbl> <dbl> +#> 1 1.4 0.2 +#> 2 1.4 0.2 +#> 3 1.3 0.2 +#> 4 1.5 0.2 +#> 5 1.4 0.2 +#> 6 1.7 0.4 +#> 7 1.4 0.3 +#> 8 1.5 0.2 +#> 9 1.4 0.2 +#> 10 1.5 0.1 +#> # ... with 140 more rows#> # A tibble: 150 × 2 +#> Sepal.Width Petal.Width +#> <dbl> <dbl> +#> 1 3.5 0.2 +#> 2 3.0 0.2 +#> 3 3.2 0.2 +#> 4 3.1 0.2 +#> 5 3.6 0.2 +#> 6 3.9 0.4 +#> 7 3.4 0.3 +#> 8 3.4 0.2 +#> 9 2.9 0.2 +#> 10 3.1 0.1 +#> # ... with 140 more rows#> # A tibble: 150 × 5 +#> Species Sepal.Length Sepal.Width Petal.Length Petal.Width +#> <fctr> <dbl> <dbl> <dbl> <dbl> +#> 1 setosa 5.1 3.5 1.4 0.2 +#> 2 setosa 4.9 3.0 1.4 0.2 +#> 3 setosa 4.7 3.2 1.3 0.2 +#> 4 setosa 4.6 3.1 1.5 0.2 +#> 5 setosa 5.0 3.6 1.4 0.2 +#> 6 setosa 5.4 3.9 1.7 0.4 +#> 7 setosa 4.6 3.4 1.4 0.3 +#> 8 setosa 5.0 3.4 1.5 0.2 +#> 9 setosa 4.4 2.9 1.4 0.2 +#> 10 setosa 4.9 3.1 1.5 0.1 +#> # ... with 140 more rows+df <- as.data.frame(matrix(runif(100), nrow = 10)) +df <- tbl_df(df[c(3, 4, 7, 1, 9, 8, 5, 2, 6, 10)]) +select(df, V4:V6)#> # A tibble: 10 × 8 +#> V4 V7 V1 V9 V8 V5 V2 +#> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> +#> 1 0.87959719 0.00250323 0.6477019 0.6523589 0.789947051 0.26714756 0.79909120 +#> 2 0.37491998 0.84770109 0.0647610 0.6675703 0.004801874 0.60840493 0.13193857 +#> 3 0.43416063 0.66004509 0.3374612 0.1980866 0.252908190 0.77196657 0.54759937 +#> 4 0.80684989 0.29450061 0.5698746 0.8681269 0.563169963 0.51975041 0.09701772 +#> 5 0.63560582 0.57010194 0.3383233 0.1732694 0.952278358 0.86047988 0.98637755 +#> 6 0.06871643 0.83903090 0.4992534 0.2049636 0.685113066 0.79302051 0.83954213 +#> 7 0.14484133 0.63062556 0.3084174 0.2171490 0.470041074 0.78391104 0.39959635 +#> 8 0.29457026 0.49672970 0.8404281 0.1508981 0.289851467 0.42372128 0.95222495 +#> 9 0.04144781 0.38952535 0.0651790 0.7745374 0.510124689 0.01551256 0.05949630 +#> 10 0.11654699 0.73144890 0.4399482 0.5330259 0.750690085 0.41620118 0.27691599 +#> # ... with 1 more variables: V6 <dbl>#> # A tibble: 10 × 3 +#> V4 V5 V6 +#> <dbl> <dbl> <dbl> +#> 1 0.87959719 0.26714756 0.006950771 +#> 2 0.37491998 0.60840493 0.390183412 +#> 3 0.43416063 0.77196657 0.238652540 +#> 4 0.80684989 0.51975041 0.384401472 +#> 5 0.63560582 0.86047988 0.073094374 +#> 6 0.06871643 0.79302051 0.766595044 +#> 7 0.14484133 0.78391104 0.687511492 +#> 8 0.29457026 0.42372128 0.841570623 +#> 9 0.04144781 0.01551256 0.105449455 +#> 10 0.11654699 0.41620118 0.340091229#> # A tibble: 150 × 3 +#> Sepal.Length Sepal.Width Species +#> <dbl> <dbl> <fctr> +#> 1 5.1 3.5 setosa +#> 2 4.9 3.0 setosa +#> 3 4.7 3.2 setosa +#> 4 4.6 3.1 setosa +#> 5 5.0 3.6 setosa +#> 6 5.4 3.9 setosa +#> 7 4.6 3.4 setosa +#> 8 5.0 3.4 setosa +#> 9 4.4 2.9 setosa +#> 10 4.9 3.1 setosa +#> # ... with 140 more rows+# Renaming ----------------------------------------- +# * select() keeps only the variables you specify +select(iris, petal_length = Petal.Length)#> # A tibble: 150 × 1 +#> petal_length +#> <dbl> +#> 1 1.4 +#> 2 1.4 +#> 3 1.3 +#> 4 1.5 +#> 5 1.4 +#> 6 1.7 +#> 7 1.4 +#> 8 1.5 +#> 9 1.4 +#> 10 1.5 +#> # ... with 140 more rows+# * rename() keeps all variables +rename(iris, petal_length = Petal.Length)#> # A tibble: 150 × 5 +#> Sepal.Length Sepal.Width petal_length Petal.Width Species +#> <dbl> <dbl> <dbl> <dbl> <fctr> +#> 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 +#> 7 4.6 3.4 1.4 0.3 setosa +#> 8 5.0 3.4 1.5 0.2 setosa +#> 9 4.4 2.9 1.4 0.2 setosa +#> 10 4.9 3.1 1.5 0.1 setosa +#> # ... with 140 more rows
These scoped variants of select()
and rename()
operate on a
+selection of variables. The semantics of these verbs have simple
+but important differences:
Selection drops variables that are not in the selection while +renaming retains them.
The renaming function is optional for selection but not for +renaming.
select_all(.tbl, .funs = list(), ...) + +rename_all(.tbl, .funs = list(), ...) + +select_if(.tbl, .predicate, .funs = list(), ...) + +rename_if(.tbl, .predicate, .funs = list(), ...) + +select_at(.tbl, .vars, .funs = list(), ...) + +rename_at(.tbl, .vars, .funs = list(), ...)+ +
.tbl | +A |
+
---|---|
.funs | +A single expression quoted with |
+
... | +Additional arguments for the function calls in
+ |
+
.predicate | +A predicate function to be applied to the columns
+or a logical vector. The variables for which |
+
.vars | +A list of columns generated by |
+
+# Supply a renaming function: +select_all(mtcars, toupper)#> MPG CYL DISP HP DRAT WT QSEC VS AM GEAR CARB +#> Mazda RX4 21.0 6 160.0 110 3.90 2.620 16.46 0 1 4 4 +#> Mazda RX4 Wag 21.0 6 160.0 110 3.90 2.875 17.02 0 1 4 4 +#> Datsun 710 22.8 4 108.0 93 3.85 2.320 18.61 1 1 4 1 +#> Hornet 4 Drive 21.4 6 258.0 110 3.08 3.215 19.44 1 0 3 1 +#> Hornet Sportabout 18.7 8 360.0 175 3.15 3.440 17.02 0 0 3 2 +#> Valiant 18.1 6 225.0 105 2.76 3.460 20.22 1 0 3 1 +#> Duster 360 14.3 8 360.0 245 3.21 3.570 15.84 0 0 3 4 +#> Merc 240D 24.4 4 146.7 62 3.69 3.190 20.00 1 0 4 2 +#> Merc 230 22.8 4 140.8 95 3.92 3.150 22.90 1 0 4 2 +#> Merc 280 19.2 6 167.6 123 3.92 3.440 18.30 1 0 4 4 +#> Merc 280C 17.8 6 167.6 123 3.92 3.440 18.90 1 0 4 4 +#> Merc 450SE 16.4 8 275.8 180 3.07 4.070 17.40 0 0 3 3 +#> Merc 450SL 17.3 8 275.8 180 3.07 3.730 17.60 0 0 3 3 +#> Merc 450SLC 15.2 8 275.8 180 3.07 3.780 18.00 0 0 3 3 +#> Cadillac Fleetwood 10.4 8 472.0 205 2.93 5.250 17.98 0 0 3 4 +#> Lincoln Continental 10.4 8 460.0 215 3.00 5.424 17.82 0 0 3 4 +#> Chrysler Imperial 14.7 8 440.0 230 3.23 5.345 17.42 0 0 3 4 +#> Fiat 128 32.4 4 78.7 66 4.08 2.200 19.47 1 1 4 1 +#> Honda Civic 30.4 4 75.7 52 4.93 1.615 18.52 1 1 4 2 +#> Toyota Corolla 33.9 4 71.1 65 4.22 1.835 19.90 1 1 4 1 +#> Toyota Corona 21.5 4 120.1 97 3.70 2.465 20.01 1 0 3 1 +#> Dodge Challenger 15.5 8 318.0 150 2.76 3.520 16.87 0 0 3 2 +#> AMC Javelin 15.2 8 304.0 150 3.15 3.435 17.30 0 0 3 2 +#> Camaro Z28 13.3 8 350.0 245 3.73 3.840 15.41 0 0 3 4 +#> Pontiac Firebird 19.2 8 400.0 175 3.08 3.845 17.05 0 0 3 2 +#> Fiat X1-9 27.3 4 79.0 66 4.08 1.935 18.90 1 1 4 1 +#> Porsche 914-2 26.0 4 120.3 91 4.43 2.140 16.70 0 1 5 2 +#> Lotus Europa 30.4 4 95.1 113 3.77 1.513 16.90 1 1 5 2 +#> Ford Pantera L 15.8 8 351.0 264 4.22 3.170 14.50 0 1 5 4 +#> Ferrari Dino 19.7 6 145.0 175 3.62 2.770 15.50 0 1 5 6 +#> Maserati Bora 15.0 8 301.0 335 3.54 3.570 14.60 0 1 5 8 +#> Volvo 142E 21.4 4 121.0 109 4.11 2.780 18.60 1 1 4 2select_all(mtcars, "toupper")#> MPG CYL DISP HP DRAT WT QSEC VS AM GEAR CARB +#> Mazda RX4 21.0 6 160.0 110 3.90 2.620 16.46 0 1 4 4 +#> Mazda RX4 Wag 21.0 6 160.0 110 3.90 2.875 17.02 0 1 4 4 +#> Datsun 710 22.8 4 108.0 93 3.85 2.320 18.61 1 1 4 1 +#> Hornet 4 Drive 21.4 6 258.0 110 3.08 3.215 19.44 1 0 3 1 +#> Hornet Sportabout 18.7 8 360.0 175 3.15 3.440 17.02 0 0 3 2 +#> Valiant 18.1 6 225.0 105 2.76 3.460 20.22 1 0 3 1 +#> Duster 360 14.3 8 360.0 245 3.21 3.570 15.84 0 0 3 4 +#> Merc 240D 24.4 4 146.7 62 3.69 3.190 20.00 1 0 4 2 +#> Merc 230 22.8 4 140.8 95 3.92 3.150 22.90 1 0 4 2 +#> Merc 280 19.2 6 167.6 123 3.92 3.440 18.30 1 0 4 4 +#> Merc 280C 17.8 6 167.6 123 3.92 3.440 18.90 1 0 4 4 +#> Merc 450SE 16.4 8 275.8 180 3.07 4.070 17.40 0 0 3 3 +#> Merc 450SL 17.3 8 275.8 180 3.07 3.730 17.60 0 0 3 3 +#> Merc 450SLC 15.2 8 275.8 180 3.07 3.780 18.00 0 0 3 3 +#> Cadillac Fleetwood 10.4 8 472.0 205 2.93 5.250 17.98 0 0 3 4 +#> Lincoln Continental 10.4 8 460.0 215 3.00 5.424 17.82 0 0 3 4 +#> Chrysler Imperial 14.7 8 440.0 230 3.23 5.345 17.42 0 0 3 4 +#> Fiat 128 32.4 4 78.7 66 4.08 2.200 19.47 1 1 4 1 +#> Honda Civic 30.4 4 75.7 52 4.93 1.615 18.52 1 1 4 2 +#> Toyota Corolla 33.9 4 71.1 65 4.22 1.835 19.90 1 1 4 1 +#> Toyota Corona 21.5 4 120.1 97 3.70 2.465 20.01 1 0 3 1 +#> Dodge Challenger 15.5 8 318.0 150 2.76 3.520 16.87 0 0 3 2 +#> AMC Javelin 15.2 8 304.0 150 3.15 3.435 17.30 0 0 3 2 +#> Camaro Z28 13.3 8 350.0 245 3.73 3.840 15.41 0 0 3 4 +#> Pontiac Firebird 19.2 8 400.0 175 3.08 3.845 17.05 0 0 3 2 +#> Fiat X1-9 27.3 4 79.0 66 4.08 1.935 18.90 1 1 4 1 +#> Porsche 914-2 26.0 4 120.3 91 4.43 2.140 16.70 0 1 5 2 +#> Lotus Europa 30.4 4 95.1 113 3.77 1.513 16.90 1 1 5 2 +#> Ford Pantera L 15.8 8 351.0 264 4.22 3.170 14.50 0 1 5 4 +#> Ferrari Dino 19.7 6 145.0 175 3.62 2.770 15.50 0 1 5 6 +#> Maserati Bora 15.0 8 301.0 335 3.54 3.570 14.60 0 1 5 8 +#> Volvo 142E 21.4 4 121.0 109 4.11 2.780 18.60 1 1 4 2#> MPG CYL DISP HP DRAT WT QSEC VS AM GEAR CARB +#> Mazda RX4 21.0 6 160.0 110 3.90 2.620 16.46 0 1 4 4 +#> Mazda RX4 Wag 21.0 6 160.0 110 3.90 2.875 17.02 0 1 4 4 +#> Datsun 710 22.8 4 108.0 93 3.85 2.320 18.61 1 1 4 1 +#> Hornet 4 Drive 21.4 6 258.0 110 3.08 3.215 19.44 1 0 3 1 +#> Hornet Sportabout 18.7 8 360.0 175 3.15 3.440 17.02 0 0 3 2 +#> Valiant 18.1 6 225.0 105 2.76 3.460 20.22 1 0 3 1 +#> Duster 360 14.3 8 360.0 245 3.21 3.570 15.84 0 0 3 4 +#> Merc 240D 24.4 4 146.7 62 3.69 3.190 20.00 1 0 4 2 +#> Merc 230 22.8 4 140.8 95 3.92 3.150 22.90 1 0 4 2 +#> Merc 280 19.2 6 167.6 123 3.92 3.440 18.30 1 0 4 4 +#> Merc 280C 17.8 6 167.6 123 3.92 3.440 18.90 1 0 4 4 +#> Merc 450SE 16.4 8 275.8 180 3.07 4.070 17.40 0 0 3 3 +#> Merc 450SL 17.3 8 275.8 180 3.07 3.730 17.60 0 0 3 3 +#> Merc 450SLC 15.2 8 275.8 180 3.07 3.780 18.00 0 0 3 3 +#> Cadillac Fleetwood 10.4 8 472.0 205 2.93 5.250 17.98 0 0 3 4 +#> Lincoln Continental 10.4 8 460.0 215 3.00 5.424 17.82 0 0 3 4 +#> Chrysler Imperial 14.7 8 440.0 230 3.23 5.345 17.42 0 0 3 4 +#> Fiat 128 32.4 4 78.7 66 4.08 2.200 19.47 1 1 4 1 +#> Honda Civic 30.4 4 75.7 52 4.93 1.615 18.52 1 1 4 2 +#> Toyota Corolla 33.9 4 71.1 65 4.22 1.835 19.90 1 1 4 1 +#> Toyota Corona 21.5 4 120.1 97 3.70 2.465 20.01 1 0 3 1 +#> Dodge Challenger 15.5 8 318.0 150 2.76 3.520 16.87 0 0 3 2 +#> AMC Javelin 15.2 8 304.0 150 3.15 3.435 17.30 0 0 3 2 +#> Camaro Z28 13.3 8 350.0 245 3.73 3.840 15.41 0 0 3 4 +#> Pontiac Firebird 19.2 8 400.0 175 3.08 3.845 17.05 0 0 3 2 +#> Fiat X1-9 27.3 4 79.0 66 4.08 1.935 18.90 1 1 4 1 +#> Porsche 914-2 26.0 4 120.3 91 4.43 2.140 16.70 0 1 5 2 +#> Lotus Europa 30.4 4 95.1 113 3.77 1.513 16.90 1 1 5 2 +#> Ford Pantera L 15.8 8 351.0 264 4.22 3.170 14.50 0 1 5 4 +#> Ferrari Dino 19.7 6 145.0 175 3.62 2.770 15.50 0 1 5 6 +#> Maserati Bora 15.0 8 301.0 335 3.54 3.570 14.60 0 1 5 8 +#> Volvo 142E 21.4 4 121.0 109 4.11 2.780 18.60 1 1 4 2+# Selection drops unselected variables: +is_whole <- function(x) all(floor(x) == x) +select_if(mtcars, is_whole, toupper)#> CYL HP VS AM GEAR CARB +#> Mazda RX4 6 110 0 1 4 4 +#> Mazda RX4 Wag 6 110 0 1 4 4 +#> Datsun 710 4 93 1 1 4 1 +#> Hornet 4 Drive 6 110 1 0 3 1 +#> Hornet Sportabout 8 175 0 0 3 2 +#> Valiant 6 105 1 0 3 1 +#> Duster 360 8 245 0 0 3 4 +#> Merc 240D 4 62 1 0 4 2 +#> Merc 230 4 95 1 0 4 2 +#> Merc 280 6 123 1 0 4 4 +#> Merc 280C 6 123 1 0 4 4 +#> Merc 450SE 8 180 0 0 3 3 +#> Merc 450SL 8 180 0 0 3 3 +#> Merc 450SLC 8 180 0 0 3 3 +#> Cadillac Fleetwood 8 205 0 0 3 4 +#> Lincoln Continental 8 215 0 0 3 4 +#> Chrysler Imperial 8 230 0 0 3 4 +#> Fiat 128 4 66 1 1 4 1 +#> Honda Civic 4 52 1 1 4 2 +#> Toyota Corolla 4 65 1 1 4 1 +#> Toyota Corona 4 97 1 0 3 1 +#> Dodge Challenger 8 150 0 0 3 2 +#> AMC Javelin 8 150 0 0 3 2 +#> Camaro Z28 8 245 0 0 3 4 +#> Pontiac Firebird 8 175 0 0 3 2 +#> Fiat X1-9 4 66 1 1 4 1 +#> Porsche 914-2 4 91 0 1 5 2 +#> Lotus Europa 4 113 1 1 5 2 +#> Ford Pantera L 8 264 0 1 5 4 +#> Ferrari Dino 6 175 0 1 5 6 +#> Maserati Bora 8 335 0 1 5 8 +#> Volvo 142E 4 109 1 1 4 2+# But renaming retains them: +rename_if(mtcars, is_whole, toupper)#> mpg CYL disp HP drat wt qsec VS AM GEAR CARB +#> Mazda RX4 21.0 6 160.0 110 3.90 2.620 16.46 0 1 4 4 +#> Mazda RX4 Wag 21.0 6 160.0 110 3.90 2.875 17.02 0 1 4 4 +#> Datsun 710 22.8 4 108.0 93 3.85 2.320 18.61 1 1 4 1 +#> Hornet 4 Drive 21.4 6 258.0 110 3.08 3.215 19.44 1 0 3 1 +#> Hornet Sportabout 18.7 8 360.0 175 3.15 3.440 17.02 0 0 3 2 +#> Valiant 18.1 6 225.0 105 2.76 3.460 20.22 1 0 3 1 +#> Duster 360 14.3 8 360.0 245 3.21 3.570 15.84 0 0 3 4 +#> Merc 240D 24.4 4 146.7 62 3.69 3.190 20.00 1 0 4 2 +#> Merc 230 22.8 4 140.8 95 3.92 3.150 22.90 1 0 4 2 +#> Merc 280 19.2 6 167.6 123 3.92 3.440 18.30 1 0 4 4 +#> Merc 280C 17.8 6 167.6 123 3.92 3.440 18.90 1 0 4 4 +#> Merc 450SE 16.4 8 275.8 180 3.07 4.070 17.40 0 0 3 3 +#> Merc 450SL 17.3 8 275.8 180 3.07 3.730 17.60 0 0 3 3 +#> Merc 450SLC 15.2 8 275.8 180 3.07 3.780 18.00 0 0 3 3 +#> Cadillac Fleetwood 10.4 8 472.0 205 2.93 5.250 17.98 0 0 3 4 +#> Lincoln Continental 10.4 8 460.0 215 3.00 5.424 17.82 0 0 3 4 +#> Chrysler Imperial 14.7 8 440.0 230 3.23 5.345 17.42 0 0 3 4 +#> Fiat 128 32.4 4 78.7 66 4.08 2.200 19.47 1 1 4 1 +#> Honda Civic 30.4 4 75.7 52 4.93 1.615 18.52 1 1 4 2 +#> Toyota Corolla 33.9 4 71.1 65 4.22 1.835 19.90 1 1 4 1 +#> Toyota Corona 21.5 4 120.1 97 3.70 2.465 20.01 1 0 3 1 +#> Dodge Challenger 15.5 8 318.0 150 2.76 3.520 16.87 0 0 3 2 +#> AMC Javelin 15.2 8 304.0 150 3.15 3.435 17.30 0 0 3 2 +#> Camaro Z28 13.3 8 350.0 245 3.73 3.840 15.41 0 0 3 4 +#> Pontiac Firebird 19.2 8 400.0 175 3.08 3.845 17.05 0 0 3 2 +#> Fiat X1-9 27.3 4 79.0 66 4.08 1.935 18.90 1 1 4 1 +#> Porsche 914-2 26.0 4 120.3 91 4.43 2.140 16.70 0 1 5 2 +#> Lotus Europa 30.4 4 95.1 113 3.77 1.513 16.90 1 1 5 2 +#> Ford Pantera L 15.8 8 351.0 264 4.22 3.170 14.50 0 1 5 4 +#> Ferrari Dino 19.7 6 145.0 175 3.62 2.770 15.50 0 1 5 6 +#> Maserati Bora 15.0 8 301.0 335 3.54 3.570 14.60 0 1 5 8 +#> Volvo 142E 21.4 4 121.0 109 4.11 2.780 18.60 1 1 4 2+# The renaming function is optional for selection: +select_if(mtcars, is_whole)#> cyl hp vs am gear carb +#> Mazda RX4 6 110 0 1 4 4 +#> Mazda RX4 Wag 6 110 0 1 4 4 +#> Datsun 710 4 93 1 1 4 1 +#> Hornet 4 Drive 6 110 1 0 3 1 +#> Hornet Sportabout 8 175 0 0 3 2 +#> Valiant 6 105 1 0 3 1 +#> Duster 360 8 245 0 0 3 4 +#> Merc 240D 4 62 1 0 4 2 +#> Merc 230 4 95 1 0 4 2 +#> Merc 280 6 123 1 0 4 4 +#> Merc 280C 6 123 1 0 4 4 +#> Merc 450SE 8 180 0 0 3 3 +#> Merc 450SL 8 180 0 0 3 3 +#> Merc 450SLC 8 180 0 0 3 3 +#> Cadillac Fleetwood 8 205 0 0 3 4 +#> Lincoln Continental 8 215 0 0 3 4 +#> Chrysler Imperial 8 230 0 0 3 4 +#> Fiat 128 4 66 1 1 4 1 +#> Honda Civic 4 52 1 1 4 2 +#> Toyota Corolla 4 65 1 1 4 1 +#> Toyota Corona 4 97 1 0 3 1 +#> Dodge Challenger 8 150 0 0 3 2 +#> AMC Javelin 8 150 0 0 3 2 +#> Camaro Z28 8 245 0 0 3 4 +#> Pontiac Firebird 8 175 0 0 3 2 +#> Fiat X1-9 4 66 1 1 4 1 +#> Porsche 914-2 4 91 0 1 5 2 +#> Lotus Europa 4 113 1 1 5 2 +#> Ford Pantera L 8 264 0 1 5 4 +#> Ferrari Dino 6 175 0 1 5 6 +#> Maserati Bora 8 335 0 1 5 8 +#> Volvo 142E 4 109 1 1 4 2
These functions allow you to select variables based on their names.
starts_with()
: starts with a prefix
ends_with()
: ends with a prefix
contains()
: contains a literal string
matches()
: matches a regular expression
num_range()
: a numerical range like x01, x02, x03.
one_of()
: variables in character vector.
everything()
: all variables.
current_vars() + +starts_with(match, ignore.case = TRUE, vars = current_vars()) + +ends_with(match, ignore.case = TRUE, vars = current_vars()) + +contains(match, ignore.case = TRUE, vars = current_vars()) + +matches(match, ignore.case = TRUE, vars = current_vars()) + +num_range(prefix, range, width = NULL, vars = current_vars()) + +one_of(..., vars = current_vars()) + +everything(vars = current_vars())+ +
match | +A string. |
+
---|---|
ignore.case | +If |
+
vars | +A character vector of variable names. When called from inside
+ |
+
prefix | +A prefix that starts the numeric range. |
+
range | +A sequence of integers, like |
+
width | +Optionally, the "width" of the numeric range. For example, +a range of 2 gives "01", a range of three "001", etc. |
+
... | +One or more character vectors. |
+
An integer vector giving the position of the matched variables.
+ + ++#> # A tibble: 150 × 2 +#> Petal.Length Petal.Width +#> <dbl> <dbl> +#> 1 1.4 0.2 +#> 2 1.4 0.2 +#> 3 1.3 0.2 +#> 4 1.5 0.2 +#> 5 1.4 0.2 +#> 6 1.7 0.4 +#> 7 1.4 0.3 +#> 8 1.5 0.2 +#> 9 1.4 0.2 +#> 10 1.5 0.1 +#> # ... with 140 more rows#> # A tibble: 150 × 2 +#> Sepal.Width Petal.Width +#> <dbl> <dbl> +#> 1 3.5 0.2 +#> 2 3.0 0.2 +#> 3 3.2 0.2 +#> 4 3.1 0.2 +#> 5 3.6 0.2 +#> 6 3.9 0.4 +#> 7 3.4 0.3 +#> 8 3.4 0.2 +#> 9 2.9 0.2 +#> 10 3.1 0.1 +#> # ... with 140 more rows#> # A tibble: 150 × 2 +#> Petal.Length Petal.Width +#> <dbl> <dbl> +#> 1 1.4 0.2 +#> 2 1.4 0.2 +#> 3 1.3 0.2 +#> 4 1.5 0.2 +#> 5 1.4 0.2 +#> 6 1.7 0.4 +#> 7 1.4 0.3 +#> 8 1.5 0.2 +#> 9 1.4 0.2 +#> 10 1.5 0.1 +#> # ... with 140 more rows#> # A tibble: 150 × 4 +#> Sepal.Length Sepal.Width Petal.Length Petal.Width +#> <dbl> <dbl> <dbl> <dbl> +#> 1 5.1 3.5 1.4 0.2 +#> 2 4.9 3.0 1.4 0.2 +#> 3 4.7 3.2 1.3 0.2 +#> 4 4.6 3.1 1.5 0.2 +#> 5 5.0 3.6 1.4 0.2 +#> 6 5.4 3.9 1.7 0.4 +#> 7 4.6 3.4 1.4 0.3 +#> 8 5.0 3.4 1.5 0.2 +#> 9 4.4 2.9 1.4 0.2 +#> 10 4.9 3.1 1.5 0.1 +#> # ... with 140 more rows#> # A tibble: 150 × 2 +#> Petal.Length Petal.Width +#> <dbl> <dbl> +#> 1 1.4 0.2 +#> 2 1.4 0.2 +#> 3 1.3 0.2 +#> 4 1.5 0.2 +#> 5 1.4 0.2 +#> 6 1.7 0.4 +#> 7 1.4 0.3 +#> 8 1.5 0.2 +#> 9 1.4 0.2 +#> 10 1.5 0.1 +#> # ... with 140 more rows#> # A tibble: 150 × 5 +#> Sepal.Length Sepal.Width Petal.Length Petal.Width Species +#> <dbl> <dbl> <dbl> <dbl> <fctr> +#> 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 +#> 7 4.6 3.4 1.4 0.3 setosa +#> 8 5.0 3.4 1.5 0.2 setosa +#> 9 4.4 2.9 1.4 0.2 setosa +#> 10 4.9 3.1 1.5 0.1 setosa +#> # ... with 140 more rows#> # A tibble: 150 × 2 +#> Petal.Length Petal.Width +#> <dbl> <dbl> +#> 1 1.4 0.2 +#> 2 1.4 0.2 +#> 3 1.3 0.2 +#> 4 1.5 0.2 +#> 5 1.4 0.2 +#> 6 1.7 0.4 +#> 7 1.4 0.3 +#> 8 1.5 0.2 +#> 9 1.4 0.2 +#> 10 1.5 0.1 +#> # ... with 140 more rows
These functions power select()
and rename()
.
select_vars(vars, ..., include = character(), exclude = character()) + +rename_vars(vars, ..., strict = TRUE)+ +
vars | +A character vector of existing column names. |
+
---|---|
..., args | +Expressions to compute +These arguments are automatically quoted and
+evaluated in a context where elements of
+ |
+
include, exclude | +Character vector of column names to always +include/exclude. |
+
strict | +If |
+
A named character vector. Values are existing column names, +names are new names.
+ + ++#> Sepal.Length Sepal.Width Petal.Length Petal.Width Species +#> "Sepal.Length" "Sepal.Width" "Petal.Length" "Petal.Width" "Species"#> Petal.Length Petal.Width +#> "Petal.Length" "Petal.Width"#> Sepal.Width Petal.Width +#> "Sepal.Width" "Petal.Width"#> Petal.Length Petal.Width +#> "Petal.Length" "Petal.Width"#> Sepal.Length Sepal.Width Petal.Length Petal.Width +#> "Sepal.Length" "Sepal.Width" "Petal.Length" "Petal.Width"select_vars(names(iris), Petal.Length, Petal.Width)#> Petal.Length Petal.Width +#> "Petal.Length" "Petal.Width"#> Petal.Length Petal.Width +#> "Petal.Length" "Petal.Width"+df <- as.data.frame(matrix(runif(100), nrow = 10)) +df <- df[c(3, 4, 7, 1, 9, 8, 5, 2, 6, 10)] +select_vars(names(df), num_range("V", 4:6))#> V4 V5 V6 +#> "V4" "V5" "V6"#> Sepal.Length Sepal.Width Species +#> "Sepal.Length" "Sepal.Width" "Species"#> Sepal.Length Petal.Length Species +#> "Sepal.Length" "Petal.Length" "Species"#> Sepal.Length Sepal.Width Species +#> "Sepal.Length" "Sepal.Width" "Species"#> Species +#> "Species"select_vars(names(iris), -Petal.Length, -Petal.Width)#> Sepal.Length Sepal.Width Species +#> "Sepal.Length" "Sepal.Width" "Species"+# Rename variables +select_vars(names(iris), petal_length = Petal.Length)#> petal_length +#> "Petal.Length"#> petal1 petal2 +#> "Petal.Length" "Petal.Width"+# Rename variables preserving all existing +rename_vars(names(iris), petal_length = Petal.Length)#> Sepal.Length Sepal.Width petal_length Petal.Width Species +#> "Sepal.Length" "Sepal.Width" "Petal.Length" "Petal.Width" "Species"+# You can unquote names or formulas (or lists of) +select_vars(names(iris), !!! list(~Petal.Length))#> Petal.Length +#> "Petal.Length"select_vars(names(iris), !! quote(Petal.Length))#> Petal.Length +#> "Petal.Length"
These functions override the set functions provided in base to make them +generic so that efficient versions for data frames and other tables can be +provided. The default methods call the base versions.
+ + +intersect(x, y, ...) + +union(x, y, ...) + +union_all(x, y, ...) + +setdiff(x, y, ...) + +setequal(x, y, ...)+ +
x, y | +objects to perform set function on (ignoring order) |
+
---|---|
... | +other arguments passed on to methods |
+
+mtcars$model <- rownames(mtcars) +first <- mtcars[1:20, ] +second <- mtcars[10:32, ] + +intersect(first, second)#> mpg cyl disp hp drat wt qsec vs am gear carb model +#> 1 19.2 6 167.6 123 3.92 3.440 18.30 1 0 4 4 Merc 280 +#> 2 17.8 6 167.6 123 3.92 3.440 18.90 1 0 4 4 Merc 280C +#> 3 16.4 8 275.8 180 3.07 4.070 17.40 0 0 3 3 Merc 450SE +#> 4 17.3 8 275.8 180 3.07 3.730 17.60 0 0 3 3 Merc 450SL +#> 5 15.2 8 275.8 180 3.07 3.780 18.00 0 0 3 3 Merc 450SLC +#> 6 10.4 8 472.0 205 2.93 5.250 17.98 0 0 3 4 Cadillac Fleetwood +#> 7 10.4 8 460.0 215 3.00 5.424 17.82 0 0 3 4 Lincoln Continental +#> 8 14.7 8 440.0 230 3.23 5.345 17.42 0 0 3 4 Chrysler Imperial +#> 9 32.4 4 78.7 66 4.08 2.200 19.47 1 1 4 1 Fiat 128 +#> 10 30.4 4 75.7 52 4.93 1.615 18.52 1 1 4 2 Honda Civic +#> 11 33.9 4 71.1 65 4.22 1.835 19.90 1 1 4 1 Toyota Corollaunion(first, second)#> mpg cyl disp hp drat wt qsec vs am gear carb model +#> 1 21.4 4 121.0 109 4.11 2.780 18.60 1 1 4 2 Volvo 142E +#> 2 15.0 8 301.0 335 3.54 3.570 14.60 0 1 5 8 Maserati Bora +#> 3 19.7 6 145.0 175 3.62 2.770 15.50 0 1 5 6 Ferrari Dino +#> 4 15.8 8 351.0 264 4.22 3.170 14.50 0 1 5 4 Ford Pantera L +#> 5 30.4 4 95.1 113 3.77 1.513 16.90 1 1 5 2 Lotus Europa +#> 6 26.0 4 120.3 91 4.43 2.140 16.70 0 1 5 2 Porsche 914-2 +#> 7 27.3 4 79.0 66 4.08 1.935 18.90 1 1 4 1 Fiat X1-9 +#> 8 19.2 8 400.0 175 3.08 3.845 17.05 0 0 3 2 Pontiac Firebird +#> 9 13.3 8 350.0 245 3.73 3.840 15.41 0 0 3 4 Camaro Z28 +#> 10 15.2 8 304.0 150 3.15 3.435 17.30 0 0 3 2 AMC Javelin +#> 11 15.5 8 318.0 150 2.76 3.520 16.87 0 0 3 2 Dodge Challenger +#> 12 21.5 4 120.1 97 3.70 2.465 20.01 1 0 3 1 Toyota Corona +#> 13 33.9 4 71.1 65 4.22 1.835 19.90 1 1 4 1 Toyota Corolla +#> 14 30.4 4 75.7 52 4.93 1.615 18.52 1 1 4 2 Honda Civic +#> 15 32.4 4 78.7 66 4.08 2.200 19.47 1 1 4 1 Fiat 128 +#> 16 14.7 8 440.0 230 3.23 5.345 17.42 0 0 3 4 Chrysler Imperial +#> 17 10.4 8 460.0 215 3.00 5.424 17.82 0 0 3 4 Lincoln Continental +#> 18 10.4 8 472.0 205 2.93 5.250 17.98 0 0 3 4 Cadillac Fleetwood +#> 19 15.2 8 275.8 180 3.07 3.780 18.00 0 0 3 3 Merc 450SLC +#> 20 17.3 8 275.8 180 3.07 3.730 17.60 0 0 3 3 Merc 450SL +#> 21 16.4 8 275.8 180 3.07 4.070 17.40 0 0 3 3 Merc 450SE +#> 22 17.8 6 167.6 123 3.92 3.440 18.90 1 0 4 4 Merc 280C +#> 23 19.2 6 167.6 123 3.92 3.440 18.30 1 0 4 4 Merc 280 +#> 24 22.8 4 140.8 95 3.92 3.150 22.90 1 0 4 2 Merc 230 +#> 25 24.4 4 146.7 62 3.69 3.190 20.00 1 0 4 2 Merc 240D +#> 26 14.3 8 360.0 245 3.21 3.570 15.84 0 0 3 4 Duster 360 +#> 27 18.1 6 225.0 105 2.76 3.460 20.22 1 0 3 1 Valiant +#> 28 18.7 8 360.0 175 3.15 3.440 17.02 0 0 3 2 Hornet Sportabout +#> 29 21.4 6 258.0 110 3.08 3.215 19.44 1 0 3 1 Hornet 4 Drive +#> 30 22.8 4 108.0 93 3.85 2.320 18.61 1 1 4 1 Datsun 710 +#> 31 21.0 6 160.0 110 3.90 2.875 17.02 0 1 4 4 Mazda RX4 Wag +#> 32 21.0 6 160.0 110 3.90 2.620 16.46 0 1 4 4 Mazda RX4setdiff(first, second)#> mpg cyl disp hp drat wt qsec vs am gear carb model +#> 1 21.0 6 160.0 110 3.90 2.620 16.46 0 1 4 4 Mazda RX4 +#> 2 21.0 6 160.0 110 3.90 2.875 17.02 0 1 4 4 Mazda RX4 Wag +#> 3 22.8 4 108.0 93 3.85 2.320 18.61 1 1 4 1 Datsun 710 +#> 4 21.4 6 258.0 110 3.08 3.215 19.44 1 0 3 1 Hornet 4 Drive +#> 5 18.7 8 360.0 175 3.15 3.440 17.02 0 0 3 2 Hornet Sportabout +#> 6 18.1 6 225.0 105 2.76 3.460 20.22 1 0 3 1 Valiant +#> 7 14.3 8 360.0 245 3.21 3.570 15.84 0 0 3 4 Duster 360 +#> 8 24.4 4 146.7 62 3.69 3.190 20.00 1 0 4 2 Merc 240D +#> 9 22.8 4 140.8 95 3.92 3.150 22.90 1 0 4 2 Merc 230setdiff(second, first)#> mpg cyl disp hp drat wt qsec vs am gear carb model +#> 1 21.5 4 120.1 97 3.70 2.465 20.01 1 0 3 1 Toyota Corona +#> 2 15.5 8 318.0 150 2.76 3.520 16.87 0 0 3 2 Dodge Challenger +#> 3 15.2 8 304.0 150 3.15 3.435 17.30 0 0 3 2 AMC Javelin +#> 4 13.3 8 350.0 245 3.73 3.840 15.41 0 0 3 4 Camaro Z28 +#> 5 19.2 8 400.0 175 3.08 3.845 17.05 0 0 3 2 Pontiac Firebird +#> 6 27.3 4 79.0 66 4.08 1.935 18.90 1 1 4 1 Fiat X1-9 +#> 7 26.0 4 120.3 91 4.43 2.140 16.70 0 1 5 2 Porsche 914-2 +#> 8 30.4 4 95.1 113 3.77 1.513 16.90 1 1 5 2 Lotus Europa +#> 9 15.8 8 351.0 264 4.22 3.170 14.50 0 1 5 4 Ford Pantera L +#> 10 19.7 6 145.0 175 3.62 2.770 15.50 0 1 5 6 Ferrari Dino +#> 11 15.0 8 301.0 335 3.54 3.570 14.60 0 1 5 8 Maserati Bora +#> 12 21.4 4 121.0 109 4.11 2.780 18.60 1 1 4 2 Volvo 142E+union_all(first, second)#> mpg cyl disp hp drat wt qsec vs am gear carb model +#> 1 21.0 6 160.0 110 3.90 2.620 16.46 0 1 4 4 Mazda RX4 +#> 2 21.0 6 160.0 110 3.90 2.875 17.02 0 1 4 4 Mazda RX4 Wag +#> 3 22.8 4 108.0 93 3.85 2.320 18.61 1 1 4 1 Datsun 710 +#> 4 21.4 6 258.0 110 3.08 3.215 19.44 1 0 3 1 Hornet 4 Drive +#> 5 18.7 8 360.0 175 3.15 3.440 17.02 0 0 3 2 Hornet Sportabout +#> 6 18.1 6 225.0 105 2.76 3.460 20.22 1 0 3 1 Valiant +#> 7 14.3 8 360.0 245 3.21 3.570 15.84 0 0 3 4 Duster 360 +#> 8 24.4 4 146.7 62 3.69 3.190 20.00 1 0 4 2 Merc 240D +#> 9 22.8 4 140.8 95 3.92 3.150 22.90 1 0 4 2 Merc 230 +#> 10 19.2 6 167.6 123 3.92 3.440 18.30 1 0 4 4 Merc 280 +#> 11 17.8 6 167.6 123 3.92 3.440 18.90 1 0 4 4 Merc 280C +#> 12 16.4 8 275.8 180 3.07 4.070 17.40 0 0 3 3 Merc 450SE +#> 13 17.3 8 275.8 180 3.07 3.730 17.60 0 0 3 3 Merc 450SL +#> 14 15.2 8 275.8 180 3.07 3.780 18.00 0 0 3 3 Merc 450SLC +#> 15 10.4 8 472.0 205 2.93 5.250 17.98 0 0 3 4 Cadillac Fleetwood +#> 16 10.4 8 460.0 215 3.00 5.424 17.82 0 0 3 4 Lincoln Continental +#> 17 14.7 8 440.0 230 3.23 5.345 17.42 0 0 3 4 Chrysler Imperial +#> 18 32.4 4 78.7 66 4.08 2.200 19.47 1 1 4 1 Fiat 128 +#> 19 30.4 4 75.7 52 4.93 1.615 18.52 1 1 4 2 Honda Civic +#> 20 33.9 4 71.1 65 4.22 1.835 19.90 1 1 4 1 Toyota Corolla +#> 21 19.2 6 167.6 123 3.92 3.440 18.30 1 0 4 4 Merc 280 +#> 22 17.8 6 167.6 123 3.92 3.440 18.90 1 0 4 4 Merc 280C +#> 23 16.4 8 275.8 180 3.07 4.070 17.40 0 0 3 3 Merc 450SE +#> 24 17.3 8 275.8 180 3.07 3.730 17.60 0 0 3 3 Merc 450SL +#> 25 15.2 8 275.8 180 3.07 3.780 18.00 0 0 3 3 Merc 450SLC +#> 26 10.4 8 472.0 205 2.93 5.250 17.98 0 0 3 4 Cadillac Fleetwood +#> 27 10.4 8 460.0 215 3.00 5.424 17.82 0 0 3 4 Lincoln Continental +#> 28 14.7 8 440.0 230 3.23 5.345 17.42 0 0 3 4 Chrysler Imperial +#> 29 32.4 4 78.7 66 4.08 2.200 19.47 1 1 4 1 Fiat 128 +#> 30 30.4 4 75.7 52 4.93 1.615 18.52 1 1 4 2 Honda Civic +#> 31 33.9 4 71.1 65 4.22 1.835 19.90 1 1 4 1 Toyota Corolla +#> 32 21.5 4 120.1 97 3.70 2.465 20.01 1 0 3 1 Toyota Corona +#> 33 15.5 8 318.0 150 2.76 3.520 16.87 0 0 3 2 Dodge Challenger +#> 34 15.2 8 304.0 150 3.15 3.435 17.30 0 0 3 2 AMC Javelin +#> 35 13.3 8 350.0 245 3.73 3.840 15.41 0 0 3 4 Camaro Z28 +#> 36 19.2 8 400.0 175 3.08 3.845 17.05 0 0 3 2 Pontiac Firebird +#> 37 27.3 4 79.0 66 4.08 1.935 18.90 1 1 4 1 Fiat X1-9 +#> 38 26.0 4 120.3 91 4.43 2.140 16.70 0 1 5 2 Porsche 914-2 +#> 39 30.4 4 95.1 113 3.77 1.513 16.90 1 1 5 2 Lotus Europa +#> 40 15.8 8 351.0 264 4.22 3.170 14.50 0 1 5 4 Ford Pantera L +#> 41 19.7 6 145.0 175 3.62 2.770 15.50 0 1 5 6 Ferrari Dino +#> 42 15.0 8 301.0 335 3.54 3.570 14.60 0 1 5 8 Maserati Bora +#> 43 21.4 4 121.0 109 4.11 2.780 18.60 1 1 4 2 Volvo 142Esetequal(mtcars, mtcars[32:1, ])#> TRUE
Slice does not work with relational databases because they have no
+intrinsic notion of row order. If you want to perform the equivalent
+operation, use filter()
and row_number()
.
slice(.data, ...)+ +
.data | +A tbl. |
+
---|---|
... | +Integer row values. +These arguments are automatically quoted and
+evaluated in the context of the data
+frame. They support unquoting and
+splicing. See |
+
When applied to a data frame, row names are silently dropped. To preserve,
+convert to an explicit variable with tibble::rownames_to_column()
.
Other single table verbs: arrange
,
+ filter
, mutate
,
+ select
, summarise
+slice(mtcars, 1L)#> # A tibble: 1 × 11 +#> mpg cyl disp hp drat wt qsec vs am gear carb +#> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> +#> 1 21 6 160 110 3.9 2.62 16.46 0 1 4 4#> # A tibble: 1 × 11 +#> mpg cyl disp hp drat wt qsec vs am gear carb +#> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> +#> 1 21.4 4 121 109 4.11 2.78 18.6 1 1 4 2#> # A tibble: 28 × 11 +#> mpg cyl disp hp drat wt qsec vs am gear carb +#> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> +#> 1 18.7 8 360.0 175 3.15 3.44 17.02 0 0 3 2 +#> 2 18.1 6 225.0 105 2.76 3.46 20.22 1 0 3 1 +#> 3 14.3 8 360.0 245 3.21 3.57 15.84 0 0 3 4 +#> 4 24.4 4 146.7 62 3.69 3.19 20.00 1 0 4 2 +#> 5 22.8 4 140.8 95 3.92 3.15 22.90 1 0 4 2 +#> 6 19.2 6 167.6 123 3.92 3.44 18.30 1 0 4 4 +#> 7 17.8 6 167.6 123 3.92 3.44 18.90 1 0 4 4 +#> 8 16.4 8 275.8 180 3.07 4.07 17.40 0 0 3 3 +#> 9 17.3 8 275.8 180 3.07 3.73 17.60 0 0 3 3 +#> 10 15.2 8 275.8 180 3.07 3.78 18.00 0 0 3 3 +#> # ... with 18 more rows#> Source: local data frame [6 x 11] +#> Groups: cyl [3] +#> +#> mpg cyl disp hp drat wt qsec vs am gear carb +#> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> +#> 1 22.8 4 108.0 93 3.85 2.320 18.61 1 1 4 1 +#> 2 24.4 4 146.7 62 3.69 3.190 20.00 1 0 4 2 +#> 3 21.0 6 160.0 110 3.90 2.620 16.46 0 1 4 4 +#> 4 21.0 6 160.0 110 3.90 2.875 17.02 0 1 4 4 +#> 5 18.7 8 360.0 175 3.15 3.440 17.02 0 0 3 2 +#> 6 14.3 8 360.0 245 3.21 3.570 15.84 0 0 3 4+# Equivalent code using filter that will also work with databases, +# but won't be as fast for in-memory data. For many databases, you'll +# need to supply an explicit variable to use to compute the row number. +filter(mtcars, row_number() == 1L)#> mpg cyl disp hp drat wt qsec vs am gear carb +#> 1 21 6 160 110 3.9 2.62 16.46 0 1 4 4#> mpg cyl disp hp drat wt qsec vs am gear carb +#> 1 21.4 4 121 109 4.11 2.78 18.6 1 1 4 2#> mpg cyl disp hp drat wt qsec vs am gear carb +#> 1 18.7 8 360.0 175 3.15 3.440 17.02 0 0 3 2 +#> 2 18.1 6 225.0 105 2.76 3.460 20.22 1 0 3 1 +#> 3 14.3 8 360.0 245 3.21 3.570 15.84 0 0 3 4 +#> 4 24.4 4 146.7 62 3.69 3.190 20.00 1 0 4 2 +#> 5 22.8 4 140.8 95 3.92 3.150 22.90 1 0 4 2 +#> 6 19.2 6 167.6 123 3.92 3.440 18.30 1 0 4 4 +#> 7 17.8 6 167.6 123 3.92 3.440 18.90 1 0 4 4 +#> 8 16.4 8 275.8 180 3.07 4.070 17.40 0 0 3 3 +#> 9 17.3 8 275.8 180 3.07 3.730 17.60 0 0 3 3 +#> 10 15.2 8 275.8 180 3.07 3.780 18.00 0 0 3 3 +#> 11 10.4 8 472.0 205 2.93 5.250 17.98 0 0 3 4 +#> 12 10.4 8 460.0 215 3.00 5.424 17.82 0 0 3 4 +#> 13 14.7 8 440.0 230 3.23 5.345 17.42 0 0 3 4 +#> 14 32.4 4 78.7 66 4.08 2.200 19.47 1 1 4 1 +#> 15 30.4 4 75.7 52 4.93 1.615 18.52 1 1 4 2 +#> 16 33.9 4 71.1 65 4.22 1.835 19.90 1 1 4 1 +#> 17 21.5 4 120.1 97 3.70 2.465 20.01 1 0 3 1 +#> 18 15.5 8 318.0 150 2.76 3.520 16.87 0 0 3 2 +#> 19 15.2 8 304.0 150 3.15 3.435 17.30 0 0 3 2 +#> 20 13.3 8 350.0 245 3.73 3.840 15.41 0 0 3 4 +#> 21 19.2 8 400.0 175 3.08 3.845 17.05 0 0 3 2 +#> 22 27.3 4 79.0 66 4.08 1.935 18.90 1 1 4 1 +#> 23 26.0 4 120.3 91 4.43 2.140 16.70 0 1 5 2 +#> 24 30.4 4 95.1 113 3.77 1.513 16.90 1 1 5 2 +#> 25 15.8 8 351.0 264 4.22 3.170 14.50 0 1 5 4 +#> 26 19.7 6 145.0 175 3.62 2.770 15.50 0 1 5 6 +#> 27 15.0 8 301.0 335 3.54 3.570 14.60 0 1 5 8 +#> 28 21.4 4 121.0 109 4.11 2.780 18.60 1 1 4 2
src()
is the standard constructor for srcs and is.src()
tests.
src(subclass, ...) + +is.src(x)+ +
subclass | +name of subclass. "src" is an abstract base class, so you
+must supply this value. |
+
---|---|
... | +fields used by object. +These dots are evaluated with explicit splicing. |
+
x | +object to test for "src"-ness. |
+
For backward compatibility dplyr provides three srcs for popular +open source databases:
src_mysql()
connects to a MySQL or MariaDB database using RMySQL::MySQL()
.
src_postgres()
connects to PostgreSQL using RPostgreSQL::PostgreSQL()
src_sqlite()
to connect to a SQLite database using RSQLite::SQLite()
.
However, modern best practice is to use tbl()
directly on an DBIConnection
.
src_mysql(dbname, host = NULL, port = 0L, username = "root", + password = "", ...) + +src_postgres(dbname = NULL, host = NULL, port = NULL, user = NULL, + password = NULL, ...) + +src_sqlite(path, create = FALSE)+ +
dbname | +Database name |
+
---|---|
host, port | +Host name and port number of database |
+
... | +for the src, other arguments passed on to the underlying
+database connector, |
+
user, username, password | +User name and password. +Generally, you should avoid saving username and password in your
+scripts as it is easy to accidentally expose valuable credentials.
+Instead, retrieve them from environment variables, or use database
+specific credential scores. For example, with MySQL you can set up |
+
path | +Path to SQLite database. You can use the special path +":memory:" to create a temporary in memory database. |
+
create | +if |
+
An S3 object with class src_dbi
, src_sql
, src
.
All data manipulation on SQL tbls are lazy: they will not actually
+run the query or retrieve the data unless you ask for it: they all return
+a new tbl_dbi
object. Use compute()
to run the query and save the
+results in a temporary in the database, or use collect()
to retrieve the
+results to R. You can see the query with show_query()
.
For best performance, the database should have an index on the variables
+that you are grouping by. Use explain()
to check that the database is using
+the indexes that you expect.
There is one excpetion: do()
is not lazy since it must pull the data
+into R.
+# Basic connection using DBI ------------------------------------------- +if (require(dbplyr, quietly = TRUE)) { + +con <- DBI::dbConnect(RSQLite::SQLite(), ":memory:") +copy_to(con, mtcars) + +DBI::dbListTables(con) + +# To retrieve a single table from a source, use `tbl()` +con %>% tbl("mtcars") + +# You can also use pass raw SQL if you want a more sophisticated query +con %>% tbl(sql("SELECT * FROM mtcars WHERE cyl == 8")) + +# To show off the full features of dplyr's database integration, +# we'll use the Lahman database. lahman_sqlite() takes care of +# creating the database. +lahman_p <- lahman_sqlite() +batting <- lahman_p %>% tbl("Batting") +batting + +# Basic data manipulation verbs work in the same way as with a tibble +batting %>% filter(yearID > 2005, G > 130) +batting %>% select(playerID:lgID) +batting %>% arrange(playerID, desc(yearID)) +batting %>% summarise(G = mean(G), n = n()) + +# There are a few exceptions. For example, databases give integer results +# when dividing one integer by another. Multiply by 1 to fix the problem +batting %>% + select(playerID:lgID, AB, R, G) %>% + mutate( + R_per_game1 = R / G, + R_per_game2 = R * 1.0 / G + ) + +# All operations are lazy: they don't do anything until you request the +# data, either by `print()`ing it (which shows the first ten rows), +# or by `collect()`ing the results locally. +system.time(recent <- filter(batting, yearID > 2010)) +system.time(collect(recent)) + +# You can see the query that dplyr creates with show_query() +batting %>% + filter(G > 0) %>% + group_by(playerID) %>% + summarise(n = n()) %>% + show_query() +}#>+#> +#> +#> +#>
This is mainly useful for testing, since makes it possible to refer to +local and remote tables using exactly the same syntax.
+ + +src_local(tbl, pkg = NULL, env = NULL) + +src_df(pkg = NULL, env = NULL)+ +
tbl | +name of the function used to generate |
+
---|---|
pkg, env | +Either the name of a package or an environment object in +which to look for objects. |
+
Generally, src_local()
should not be called directly, but instead
+one of the constructors should be used.
+
This data comes from SWAPI, the Star Wars API, http://swapi.co/
+ + +starwars
+
+ A tibble with 87 rows and 13 variables:
Name of the character
Height (cm)
Weight (kg)
Hair, skin, and eye colors
Year born (BBY = Before Battle of Yavin)
male, female, hermaphrodite, or none.
Name of homeworld
Name of species
List of films the character appeared in
List of vehicles the character has piloted
List of starships the character has piloted
+starwars#> # A tibble: 87 × 13 +#> name height mass hair_color skin_color eye_color +#> <chr> <int> <dbl> <chr> <chr> <chr> +#> 1 Luke Skywalker 172 77 blond fair blue +#> 2 C-3PO 167 75 <NA> gold yellow +#> 3 R2-D2 96 32 <NA> white, blue red +#> 4 Darth Vader 202 136 none white yellow +#> 5 Leia Organa 150 49 brown light brown +#> 6 Owen Lars 178 120 brown, grey light blue +#> 7 Beru Whitesun lars 165 75 brown light blue +#> 8 R5-D4 97 32 <NA> white, red red +#> 9 Biggs Darklighter 183 84 black light brown +#> 10 Obi-Wan Kenobi 182 77 auburn, white fair blue-gray +#> # ... with 77 more rows, and 7 more variables: birth_year <dbl>, gender <chr>, +#> # homeworld <chr>, species <chr>, films <list>, vehicles <list>, +#> # starships <list>
This data is a subset of the NOAA Atlantic hurricane database best track +data, http://www.nhc.noaa.gov/data/#hurdat. The data includes the +positions and attributes of 198 tropical storms, measured every six hours +during the lifetime of a storm.
+ + +storms
+
+ A tibble with 10,010 observations and 13 variables:
Storm Name
Date of report
Hour of report (in UTC)
Location of storm center
Storm classification (Tropical Depression, Tropical Storm, +or Hurricane)
Saffir-Simpson storm category (estimated from wind speed. +-1 = Tropical Depression, 0 = Tropical Storm)
storm's maximum sustained wind speed (in knots)
Air pressure at the storm's center (in millibars)
Diameter of the area experiencing tropical storm strength winds (34 knots or above)
Diameter of the area experiencing hurricane strength winds (64 knots or above)
+storms#> # A tibble: 10,010 × 13 +#> name year month day hour lat long status category wind +#> <chr> <dbl> <dbl> <int> <dbl> <dbl> <dbl> <chr> <ord> <int> +#> 1 Amy 1975 6 27 0 27.5 -79.0 tropical depression -1 25 +#> 2 Amy 1975 6 27 6 28.5 -79.0 tropical depression -1 25 +#> 3 Amy 1975 6 27 12 29.5 -79.0 tropical depression -1 25 +#> 4 Amy 1975 6 27 18 30.5 -79.0 tropical depression -1 25 +#> 5 Amy 1975 6 28 0 31.5 -78.8 tropical depression -1 25 +#> 6 Amy 1975 6 28 6 32.4 -78.7 tropical depression -1 25 +#> 7 Amy 1975 6 28 12 33.3 -78.0 tropical depression -1 25 +#> 8 Amy 1975 6 28 18 34.0 -77.0 tropical depression -1 30 +#> 9 Amy 1975 6 29 0 34.4 -75.8 tropical storm 0 35 +#> 10 Amy 1975 6 29 6 34.0 -74.8 tropical storm 0 40 +#> # ... with 10,000 more rows, and 3 more variables: pressure <int>, +#> # ts_diameter <dbl>, hu_diameter <dbl>
summarise()
is typically used on grouped data created by group_by()
.
+The output will have one row for each group.
summarise(.data, ...) + +summarize(.data, ...)+ +
.data | +A tbl. All main verbs are S3 generics and provide methods
+for |
+
---|---|
... | +Name-value pairs of summary functions. The name will be the
+name of the variable in the result. The value should be an expression
+that returns a single value like These arguments are automatically quoted and
+evaluated in the context of the data
+frame. They support unquoting and
+splicing. See |
+
An object of the same class as .data
. One grouping level will
+be dropped.
Center: mean()
, median()
Spread: sd()
, IQR()
, mad()
Range: min()
, max()
, quantile()
Count: n()
, n_distinct()
Logical: any()
, all()
Data frames are the only backend that supports creating a variable and +using it in the same summary. See examples for more details.
+ +When applied to a data frame, row names are silently dropped. To preserve,
+convert to an explicit variable with tibble::rownames_to_column()
.
Other single table verbs: arrange
,
+ filter
, mutate
,
+ select
, slice
+# A summary applied to ungrouped tbl returns a single row +mtcars %>% + summarise(mean = mean(disp), n = n())#> mean n +#> 1 230.7219 32+# Usually, you'll want to group first +mtcars %>% + group_by(cyl) %>% + summarise(mean = mean(disp), n = n())#> # A tibble: 3 × 3 +#> cyl mean n +#> <dbl> <dbl> <int> +#> 1 4 105.1364 11 +#> 2 6 183.3143 7 +#> 3 8 353.1000 14+# Each summary call removes one grouping level (since that group +# is now just a single row) +mtcars %>% + group_by(cyl, vs) %>% + summarise(cyl_n = n()) %>% + group_vars()#> [1] "cyl"+# Note that with data frames, newly created summaries immediately +# overwrite existing variables +mtcars %>% + group_by(cyl) %>% + summarise(disp = mean(disp), sd = sd(disp))#> # A tibble: 3 × 3 +#> cyl disp sd +#> <dbl> <dbl> <dbl> +#> 1 4 105.1364 NA +#> 2 6 183.3143 NA +#> 3 8 353.1000 NA
These verbs are scoped variants of summarise()
, mutate()
and
+transmute()
. They apply operations on a selection of variables.
summarise_all()
, mutate_all()
and transmute_all()
apply the
+functions to all (non-grouping) columns.
summarise_at()
, mutate_at()
and transmute_at()
allow you to
+select columns using the same name-based select_helpers just
+like with select()
.
summarise_if
(), mutate_if
() and transmute_if()
operate on
+columns for which a predicate returns TRUE
.
summarise_each()
and mutate_each()
are older variants that
+are now deprecated.
summarise_all(.tbl, .funs, ...) + +summarise_if(.tbl, .predicate, .funs, ...) + +summarise_at(.tbl, .vars, .funs, ..., .cols = NULL) + +summarize_all(.tbl, .funs, ...) + +summarize_if(.tbl, .predicate, .funs, ...) + +summarize_at(.tbl, .vars, .funs, ..., .cols = NULL) + +mutate_all(.tbl, .funs, ...) + +mutate_if(.tbl, .predicate, .funs, ...) + +mutate_at(.tbl, .vars, .funs, ..., .cols = NULL) + +transmute_all(.tbl, .funs, ...) + +transmute_if(.tbl, .predicate, .funs, ...) + +transmute_at(.tbl, .vars, .funs, ..., .cols = NULL)+ +
.tbl | +A |
+
---|---|
.funs | +List of function calls generated by |
+
... | +Additional arguments for the function calls in
+ |
+
.predicate | +A predicate function to be applied to the columns
+or a logical vector. The variables for which |
+
.vars | +A list of columns generated by |
+
.cols | +This argument has been renamed to |
+
A data frame. By default, the newly created columns have the shortest +names needed to uniquely identify the output. To force inclusion of a name, +even when not needed, name the input (see examples for details).
+ ++# The scoped variants of summarise() and mutate() make it easy to +# apply the same transformation to multiple variables: + +iris %>% + group_by(Species) %>% + summarise_all(mean)#> # A tibble: 3 × 5 +#> Species Sepal.Length Sepal.Width Petal.Length Petal.Width +#> <fctr> <dbl> <dbl> <dbl> <dbl> +#> 1 setosa 5.006 3.428 1.462 0.246 +#> 2 versicolor 5.936 2.770 4.260 1.326 +#> 3 virginica 6.588 2.974 5.552 2.026+# There are three variants. +# * _all affects every variable +# * _at affects variables selected with a character vector or vars() +# * _if affects variables selected with a predicate function: + +starwars %>% summarise_at(vars(height:mass), mean, na.rm = TRUE)#> # A tibble: 1 × 2 +#> height mass +#> <dbl> <dbl> +#> 1 174.358 97.31186starwars %>% summarise_at(c("height", "mass"), mean, na.rm = TRUE)#> # A tibble: 1 × 2 +#> height mass +#> <dbl> <dbl> +#> 1 174.358 97.31186starwars %>% summarise_if(is.numeric, mean, na.rm = TRUE)#> # A tibble: 1 × 3 +#> height mass birth_year +#> <dbl> <dbl> <dbl> +#> 1 174.358 97.31186 87.56512+# mutate_if is particularly useful for transforming variables from +# one type to another +iris %>% as_tibble() %>% mutate_if(is.factor, as.character)#> # A tibble: 150 × 5 +#> Sepal.Length Sepal.Width Petal.Length Petal.Width Species +#> <dbl> <dbl> <dbl> <dbl> <chr> +#> 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 +#> 7 4.6 3.4 1.4 0.3 setosa +#> 8 5.0 3.4 1.5 0.2 setosa +#> 9 4.4 2.9 1.4 0.2 setosa +#> 10 4.9 3.1 1.5 0.1 setosa +#> # ... with 140 more rows#> # A tibble: 150 × 5 +#> Sepal.Length Sepal.Width Petal.Length Petal.Width Species +#> <int> <int> <int> <int> <fctr> +#> 1 5 3 1 0 setosa +#> 2 4 3 1 0 setosa +#> 3 4 3 1 0 setosa +#> 4 4 3 1 0 setosa +#> 5 5 3 1 0 setosa +#> 6 5 3 1 0 setosa +#> 7 4 3 1 0 setosa +#> 8 5 3 1 0 setosa +#> 9 4 2 1 0 setosa +#> 10 4 3 1 0 setosa +#> # ... with 140 more rows+# --------------------------------------------------------------------------- +# If you want apply multiple transformations, use funs() +by_species <- iris %>% group_by(Species) + +by_species %>% summarise_all(funs(min, max))#> # A tibble: 3 × 9 +#> Species Sepal.Length_min Sepal.Width_min Petal.Length_min Petal.Width_min +#> <fctr> <dbl> <dbl> <dbl> <dbl> +#> 1 setosa 4.3 2.3 1.0 0.1 +#> 2 versicolor 4.9 2.0 3.0 1.0 +#> 3 virginica 4.9 2.2 4.5 1.4 +#> # ... with 4 more variables: Sepal.Length_max <dbl>, Sepal.Width_max <dbl>, +#> # Petal.Length_max <dbl>, Petal.Width_max <dbl># Note that output variable name now includes the function name, in order to +# keep things distinct. + +# You can express more complex inline transformations using . +by_species %>% mutate_all(funs(. / 2.54))#> Source: local data frame [150 x 5] +#> Groups: Species [3] +#> +#> Sepal.Length Sepal.Width Petal.Length Petal.Width Species +#> <dbl> <dbl> <dbl> <dbl> <fctr> +#> 1 2.007874 1.377953 0.5511811 0.07874016 setosa +#> 2 1.929134 1.181102 0.5511811 0.07874016 setosa +#> 3 1.850394 1.259843 0.5118110 0.07874016 setosa +#> 4 1.811024 1.220472 0.5905512 0.07874016 setosa +#> 5 1.968504 1.417323 0.5511811 0.07874016 setosa +#> 6 2.125984 1.535433 0.6692913 0.15748031 setosa +#> 7 1.811024 1.338583 0.5511811 0.11811024 setosa +#> 8 1.968504 1.338583 0.5905512 0.07874016 setosa +#> 9 1.732283 1.141732 0.5511811 0.07874016 setosa +#> 10 1.929134 1.220472 0.5905512 0.03937008 setosa +#> # ... with 140 more rows+# Function names will be included if .funs has names or multiple inputs +by_species %>% mutate_all(funs(cm = . / 2.54))#> Source: local data frame [150 x 9] +#> Groups: Species [3] +#> +#> Sepal.Length Sepal.Width Petal.Length Petal.Width Species Sepal.Length_cm +#> <dbl> <dbl> <dbl> <dbl> <fctr> <dbl> +#> 1 5.1 3.5 1.4 0.2 setosa 2.007874 +#> 2 4.9 3.0 1.4 0.2 setosa 1.929134 +#> 3 4.7 3.2 1.3 0.2 setosa 1.850394 +#> 4 4.6 3.1 1.5 0.2 setosa 1.811024 +#> 5 5.0 3.6 1.4 0.2 setosa 1.968504 +#> 6 5.4 3.9 1.7 0.4 setosa 2.125984 +#> 7 4.6 3.4 1.4 0.3 setosa 1.811024 +#> 8 5.0 3.4 1.5 0.2 setosa 1.968504 +#> 9 4.4 2.9 1.4 0.2 setosa 1.732283 +#> 10 4.9 3.1 1.5 0.1 setosa 1.929134 +#> # ... with 140 more rows, and 3 more variables: Sepal.Width_cm <dbl>, +#> # Petal.Length_cm <dbl>, Petal.Width_cm <dbl>#> # A tibble: 3 × 5 +#> Species Sepal.Length_med Sepal.Width_med Petal.Length_med Petal.Width_med +#> <fctr> <dbl> <dbl> <dbl> <dbl> +#> 1 setosa 5.0 3.4 1.50 0.2 +#> 2 versicolor 5.9 2.8 4.35 1.3 +#> 3 virginica 6.5 3.0 5.55 2.0#> # A tibble: 3 × 5 +#> Species Sepal.Length_Q3 Sepal.Width_Q3 Petal.Length_Q3 Petal.Width_Q3 +#> <fctr> <dbl> <dbl> <dbl> <dbl> +#> 1 setosa 5.2 3.675 1.575 0.3 +#> 2 versicolor 6.3 3.000 4.600 1.5 +#> 3 virginica 6.9 3.175 5.875 2.3by_species %>% summarise_all(c("min", "max"))#> # A tibble: 3 × 9 +#> Species Sepal.Length_min Sepal.Width_min Petal.Length_min Petal.Width_min +#> <fctr> <dbl> <dbl> <dbl> <dbl> +#> 1 setosa 4.3 2.3 1.0 0.1 +#> 2 versicolor 4.9 2.0 3.0 1.0 +#> 3 virginica 4.9 2.2 4.5 1.4 +#> # ... with 4 more variables: Sepal.Length_max <dbl>, Sepal.Width_max <dbl>, +#> # Petal.Length_max <dbl>, Petal.Width_max <dbl>
mutate_each()
and summarise_each()
are deprecated in favour of
+a more featureful family of functions: mutate_all()
,
+mutate_at()
, mutate_if()
, summarise_all()
, summarise_at()
+and summarise_if()
.
summarise_each(tbl, funs, ...) + +summarise_each_(tbl, funs, vars) + +mutate_each(tbl, funs, ...) + +mutate_each_(tbl, funs, vars) + +summarise_each_q(...) + +mutate_each_q(...) + +summarize_each(tbl, funs, ...) + +summarize_each_(tbl, funs, vars)+ + +
tally()
is a convenient wrapper for summarise that will either call
+n()
or sum(n)
depending on whether you're tallying
+for the first time, or re-tallying. count()
is similar, but also
+does the group_by()
for you.
+
+ add_tally()
adds a column "n" to a table based on the number
+of items within each existing group, while add_count()
is a shortcut that
+does the grouping as well. These functions are to tally()
+and count()
as mutate()
is to summarise()
:
+they add an additional column rather than collapsing each group.
tally(x, wt, sort = FALSE) + +count(x, ..., wt = NULL, sort = FALSE) + +add_tally(x, wt, sort = FALSE) + +add_count(x, ..., wt = NULL, sort = FALSE)+ +
x | +a |
+
---|---|
wt | +(Optional) If omitted, will count the number of rows. If
+specified, will perform a "weighted" tally by summing the
+(non-missing) values of variable |
+
sort | +if |
+
... | +Variables to group by. |
+
A tbl, grouped the same way as x
.
The column name in the returned data is usually n
, even if you
+have supplied a weight.
If the data already already has a column named n
, the output column
+will be called nn
. If the table already has columns called n
and nn
+then the column returned will be nnn
, and so on.
There is currently no way to control the output variable name - if you
+need to change the default, you'll have to write the summarise()
+yourself.
+# tally() is short-hand for mutate() +mtcars %>% tally()#> n +#> 1 32# count() is a short-hand for group_by() + tally() +mtcars %>% count(cyl)#> # A tibble: 3 × 2 +#> cyl n +#> <dbl> <int> +#> 1 4 11 +#> 2 6 7 +#> 3 8 14+# add_tally() is short-hand for mutate() +mtcars %>% add_tally()#> # A tibble: 32 × 12 +#> mpg cyl disp hp drat wt qsec vs am gear carb n +#> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <int> +#> 1 21.0 6 160.0 110 3.90 2.620 16.46 0 1 4 4 32 +#> 2 21.0 6 160.0 110 3.90 2.875 17.02 0 1 4 4 32 +#> 3 22.8 4 108.0 93 3.85 2.320 18.61 1 1 4 1 32 +#> 4 21.4 6 258.0 110 3.08 3.215 19.44 1 0 3 1 32 +#> 5 18.7 8 360.0 175 3.15 3.440 17.02 0 0 3 2 32 +#> 6 18.1 6 225.0 105 2.76 3.460 20.22 1 0 3 1 32 +#> 7 14.3 8 360.0 245 3.21 3.570 15.84 0 0 3 4 32 +#> 8 24.4 4 146.7 62 3.69 3.190 20.00 1 0 4 2 32 +#> 9 22.8 4 140.8 95 3.92 3.150 22.90 1 0 4 2 32 +#> 10 19.2 6 167.6 123 3.92 3.440 18.30 1 0 4 4 32 +#> # ... with 22 more rows# add_count() is a short-hand for group_by() + add_tally() +mtcars %>% add_count(cyl)#> # A tibble: 32 × 12 +#> mpg cyl disp hp drat wt qsec vs am gear carb n +#> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <int> +#> 1 21.0 6 160.0 110 3.90 2.620 16.46 0 1 4 4 7 +#> 2 21.0 6 160.0 110 3.90 2.875 17.02 0 1 4 4 7 +#> 3 22.8 4 108.0 93 3.85 2.320 18.61 1 1 4 1 11 +#> 4 21.4 6 258.0 110 3.08 3.215 19.44 1 0 3 1 7 +#> 5 18.7 8 360.0 175 3.15 3.440 17.02 0 0 3 2 14 +#> 6 18.1 6 225.0 105 2.76 3.460 20.22 1 0 3 1 7 +#> 7 14.3 8 360.0 245 3.21 3.570 15.84 0 0 3 4 14 +#> 8 24.4 4 146.7 62 3.69 3.190 20.00 1 0 4 2 11 +#> 9 22.8 4 140.8 95 3.92 3.150 22.90 1 0 4 2 11 +#> 10 19.2 6 167.6 123 3.92 3.440 18.30 1 0 4 4 7 +#> # ... with 22 more rows+# count and tally are designed so that you can call +# them repeatedly, each time rolling up a level of detail +species <- starwars %>% count(species, homeworld, sort = TRUE) +species#> # A tibble: 58 × 3 +#> species homeworld n +#> <chr> <chr> <int> +#> 1 Human Tatooine 8 +#> 2 Human Naboo 5 +#> 3 Human <NA> 5 +#> 4 Gungan Naboo 3 +#> 5 Human Alderaan 3 +#> 6 Droid Tatooine 2 +#> 7 Droid <NA> 2 +#> 8 Human Corellia 2 +#> 9 Human Coruscant 2 +#> 10 Kaminoan Kamino 2 +#> # ... with 48 more rowsspecies %>% count(species, sort = TRUE)#> # A tibble: 38 × 2 +#> species nn +#> <chr> <int> +#> 1 Human 16 +#> 2 Droid 3 +#> 3 <NA> 3 +#> 4 Zabrak 2 +#> 5 Aleena 1 +#> 6 Besalisk 1 +#> 7 Cerean 1 +#> 8 Chagrian 1 +#> 9 Clawdite 1 +#> 10 Dug 1 +#> # ... with 28 more rows+# add_count() is useful for groupwise filtering +# e.g.: show only species that have a single member +starwars %>% + add_count(species) %>% + filter(n == 1)#> # A tibble: 29 × 14 +#> name height mass hair_color skin_color eye_color +#> <chr> <int> <dbl> <chr> <chr> <chr> +#> 1 Greedo 173 74 <NA> green black +#> 2 Jabba Desilijic Tiure 175 1358 <NA> green-tan, brown orange +#> 3 Yoda 66 17 white green brown +#> 4 Bossk 190 113 none green red +#> 5 Ackbar 180 83 none brown mottle orange +#> 6 Wicket Systri Warrick 88 20 brown brown brown +#> 7 Nien Nunb 160 68 none grey black +#> 8 Nute Gunray 191 90 none mottled green red +#> 9 Watto 137 NA black blue, grey yellow +#> 10 Sebulba 112 40 none grey, red orange +#> # ... with 19 more rows, and 8 more variables: birth_year <dbl>, gender <chr>, +#> # homeworld <chr>, species <chr>, films <list>, vehicles <list>, +#> # starships <list>, n <int>
This is a generic method that dispatches based on the first argument.
+ + +tbl(src, ...) + +is.tbl(x) + +as.tbl(x, ...)+ +
src | +A data source |
+
---|---|
... | +Other arguments passed on to the individual methods |
+
x | +an object to coerce to a |
+
A cube tbl stores data in a compact array format where dimension +names are not needlessly repeated. They are particularly appropriate for +experimental data where all combinations of factors are tried (e.g. +complete factorial designs), or for storing the result of aggregations. +Compared to data frames, they will occupy much less memory when variables +are crossed, not nested.
+ + +tbl_cube(dimensions, measures)+ +
dimensions | +A named list of vectors. A dimension is a variable
+whose values are known before the experiement is conducted; they are
+fixed by design (in reshape2 they are known as id variables).
+ |
+
---|---|
measures | +A named list of arrays. A measure is something that is +actually measured, and is not known in advance. The dimension of each +array should be the same as the length of the dimensions. Measures are +typically, but not always, continuous values. |
+
tbl_cube
support is currently experimental and little performance
+optimisation has been done, but you may find them useful if your data
+already comes in this form, or you struggle with the memory overhead of the
+sparse/crossed of data frames. There is no support for hierarchical
+indices (although I think that would be a relatively straightforward
+extension to storing data frames for indices rather than vectors).
Manipulation functions:
select()
(M)
summarise()
(M), corresponds to roll-up, but rather more
+limited since there are no hierarchies.
filter()
(D), corresponds to slice/dice.
mutate()
(M) is not implemented, but should be relatively
+straightforward given the implementation of summarise
.
arrange()
(D?) Not implemented: not obvious how much sense
+it would make
Joins: not implemented. See vignettes/joins.graffle
for ideas.
+Probably straightforward if you get the indexes right, and that's probably
+some straightforward array/tensor operation.
as.tbl_cube()
for ways of coercing existing data
+structures into a tbl_cube
.
+# The built in nasa dataset records meterological data (temperature, +# cloud cover, ozone etc) for a 4d spatio-temporal dataset (lat, long, +# month and year) +nasa#> Source: local array [41,472 x 4] +#> D: lat [dbl, 24] +#> D: long [dbl, 24] +#> D: month [int, 12] +#> D: year [int, 6] +#> M: cloudhigh [dbl] +#> M: cloudlow [dbl] +#> M: cloudmid [dbl] +#> M: ozone [dbl] +#> M: pressure [dbl] +#> M: surftemp [dbl] +#> M: temperature [dbl]head(as.data.frame(nasa))#> lat long month year cloudhigh cloudlow cloudmid ozone pressure +#> 1 36.20000 -113.8 1 1995 26.0 7.5 34.5 304 835 +#> 2 33.70435 -113.8 1 1995 20.0 11.5 32.5 304 940 +#> 3 31.20870 -113.8 1 1995 16.0 16.5 26.0 298 960 +#> 4 28.71304 -113.8 1 1995 13.0 20.5 14.5 276 990 +#> 5 26.21739 -113.8 1 1995 7.5 26.0 10.5 274 1000 +#> 6 23.72174 -113.8 1 1995 8.0 30.0 9.5 264 1000 +#> surftemp temperature +#> 1 272.7 272.1 +#> 2 279.5 282.2 +#> 3 284.7 285.2 +#> 4 289.3 290.7 +#> 5 292.2 292.7 +#> 6 294.1 293.6#> Class Sex Age Survived Freq +#> 1 1st Male Child No 0 +#> 2 2nd Male Child No 0 +#> 3 3rd Male Child No 35 +#> 4 Crew Male Child No 0 +#> 5 1st Female Child No 0 +#> 6 2nd Female Child No 0#> Admit Gender Dept Freq +#> 1 Admitted Male A 512 +#> 2 Rejected Male A 313 +#> 3 Admitted Female A 89 +#> 4 Rejected Female A 19 +#> 5 Admitted Male B 353 +#> 6 Rejected Male B 207#> Source: local array [96 x 3] +#> D: agegp [ord, 6] +#> D: alcgp [ord, 4] +#> D: tobgp [ord, 4] +#> M: ncases [dbl] +#> M: ncontrols [dbl]+# Some manipulation examples with the NASA dataset -------------------------- + +# select() operates only on measures: it doesn't affect dimensions in any way +select(nasa, cloudhigh:cloudmid)#> Source: local array [41,472 x 4] +#> D: lat [dbl, 24] +#> D: long [dbl, 24] +#> D: month [int, 12] +#> D: year [int, 6] +#> M: cloudhigh [dbl] +#> M: cloudlow [dbl] +#> M: cloudmid [dbl]#> Source: local array [41,472 x 4] +#> D: lat [dbl, 24] +#> D: long [dbl, 24] +#> D: month [int, 12] +#> D: year [int, 6] +#> M: surftemp [dbl] +#> M: temperature [dbl]#> Source: local array [4,320 x 4] +#> D: lat [dbl, 15] +#> D: long [dbl, 24] +#> D: month [int, 12] +#> D: year [int, 1] +#> M: cloudhigh [dbl] +#> M: cloudlow [dbl] +#> M: cloudmid [dbl] +#> M: ozone [dbl] +#> M: pressure [dbl] +#> M: surftemp [dbl] +#> M: temperature [dbl]# Each component can only refer to one dimensions, ensuring that you always +# create a rectangular subset +## Not run: filter(nasa, lat > long) + +# Arrange is meaningless for tbl_cubes + +by_loc <- group_by(nasa, lat, long) +summarise(by_loc, pressure = max(pressure), temp = mean(temperature))#> Source: local array [576 x 2] +#> D: lat [dbl, 24] +#> D: long [dbl, 24] +#> M: pressure [dbl] +#> M: temp [dbl]
Deprecated: please use tibble::as_tibble()
instead.
tbl_df(data)+ +
data | +a data frame |
+
---|
tbl_vars()
returns all variables while tbl_nongroup_vars()
+returns only non-grouping variables.
tbl_vars(x) + +tbl_nongroup_vars(x)+ +
x | +A tbl object |
+
---|
group_vars()
for a function that returns grouping
+variables.
This is a convenient wrapper that uses filter()
and
+min_rank()
to select the top or bottom entries in each group,
+ordered by wt
.
top_n(x, n, wt)+ +
x | +a |
+
---|---|
n | +number of rows to return. If If |
+
wt | +(Optional). The variable to use for ordering. If not +specified, defaults to the last variable in the tbl. +This argument is automatically quoted and later
+evaluated in the context of the data
+frame. It supports unquoting. See
+ |
+
+df <- data.frame(x = c(10, 4, 1, 6, 3, 1, 1)) +df %>% top_n(2)#>#> x +#> 1 10 +#> 2 6+# Negative values select bottom from group. Note that we get more +# than 2 values here because there's a tie: top_n() either takes +# all rows with a value, or none. +df %>% top_n(-2)#>#> x +#> 1 1 +#> 2 1 +#> 3 1+if (require("Lahman")) { +# Find 10 players with most games +# A little nicer with %>% +tbl_df(Batting) %>% + group_by(playerID) %>% + tally(G) %>% + top_n(10) + +# Find year with most games for each player +tbl_df(Batting) %>% group_by(playerID) %>% top_n(1, G) +}#>#> Source: local data frame [19,516 x 22] +#> Groups: playerID [18,659] +#> +#> playerID yearID stint teamID lgID G AB R H X2B X3B +#> <chr> <int> <int> <fctr> <fctr> <int> <int> <int> <int> <int> <int> +#> 1 abercda01 1871 1 TRO NA 1 4 0 0 0 0 +#> 2 armstbo01 1871 1 FW1 NA 12 49 9 11 2 1 +#> 3 barkeal01 1871 1 RC1 NA 1 4 0 1 0 0 +#> 4 barrebi01 1871 1 FW1 NA 1 5 1 1 1 0 +#> 5 barrofr01 1871 1 BS1 NA 18 86 13 13 2 1 +#> 6 bassjo01 1871 1 CL1 NA 22 89 18 27 1 10 +#> 7 bellast01 1871 1 TRO NA 29 128 26 32 3 3 +#> 8 berkena01 1871 1 PH1 NA 1 4 0 0 0 0 +#> 9 berryto01 1871 1 PH1 NA 1 4 0 1 0 0 +#> 10 berthha01 1871 1 WS3 NA 17 73 17 17 1 1 +#> # ... with 19,506 more rows, and 11 more variables: HR <int>, RBI <int>, +#> # SB <int>, CS <int>, BB <int>, SO <int>, IBB <int>, HBP <int>, SH <int>, +#> # SF <int>, GIDP <int>
This helper is intended to provide equivalent semantics to
+select()
. It is used for instance in scoped summarising and
+mutating verbs (mutate_at()
and summarise_at()
).
vars(...)+ +
... | +Variables to include/exclude in mutate/summarise. You
+can use same specifications as in These arguments are automatically quoted and later
+evaluated in the context of the data
+frame. They support unquoting. See
+ |
+
---|
Note that verbs accepting a vars()
specification also accept an
+integerish vector of positions or a
+character vector of column names.
funs()
, all_vars()
and any_vars()
for other quoting
+functions that you can use with scoped verbs.
This is used to power the ordering parameters of dplyr's window functions
+ + +with_order(order_by, fun, x, ...)+ +
order_by | +vector to order by |
+
---|---|
fun | +window function |
+
x, ... | +arguments to |
+