library(dplyr)
## 
## Attaching package: 'dplyr'
## The following objects are masked from 'package:stats':
## 
##     filter, lag
## The following objects are masked from 'package:base':
## 
##     intersect, setdiff, setequal, union
library(tidyverse)
## ── Attaching core tidyverse packages ──────────────────────── tidyverse 2.0.0 ──
## ✔ forcats   1.0.0     ✔ readr     2.1.5
## ✔ ggplot2   3.5.2     ✔ stringr   1.5.1
## ✔ lubridate 1.9.4     ✔ tibble    3.3.0
## ✔ purrr     1.1.0     ✔ tidyr     1.3.1
## ── Conflicts ────────────────────────────────────────── tidyverse_conflicts() ──
## ✖ dplyr::filter() masks stats::filter()
## ✖ dplyr::lag()    masks stats::lag()
## ℹ Use the conflicted package (<http://conflicted.r-lib.org/>) to force all conflicts to become errors
library(janitor)
## 
## Attaching package: 'janitor'
## 
## The following objects are masked from 'package:stats':
## 
##     chisq.test, fisher.test
library(ggplot2)
library(factoextra)
## Welcome! Want to learn more? See two factoextra-related books at https://goo.gl/ve3WBa
grammy_data <- read_csv("Grammy Award Nominees and Winners 1958-2024.csv")
## New names:
## Rows: 25305 Columns: 9
## ── Column specification
## ──────────────────────────────────────────────────────── Delimiter: "," chr
## (4): Award Type, Award Name, Work, Nominee dbl (4): ...1, Year, Ceremony, Award
## ID lgl (1): Winner
## ℹ Use `spec()` to retrieve the full column specification for this data. ℹ
## Specify the column types or set `show_col_types = FALSE` to quiet this message.
## • `` -> `...1`
summary(grammy_data)
##       ...1            Year         Ceremony        Award ID     
##  Min.   :    0   Min.   :1958   Min.   : 1.00   Min.   : 584.0  
##  1st Qu.: 6326   1st Qu.:1982   1st Qu.:25.00   1st Qu.: 614.0  
##  Median :12652   Median :1998   Median :41.00   Median : 661.0  
##  Mean   :12652   Mean   :1996   Mean   :38.79   Mean   : 672.3  
##  3rd Qu.:18978   3rd Qu.:2010   3rd Qu.:53.00   3rd Qu.: 701.0  
##  Max.   :25304   Max.   :2024   Max.   :67.00   Max.   :2432.0  
##   Award Type         Award Name            Work             Nominee         
##  Length:25305       Length:25305       Length:25305       Length:25305      
##  Class :character   Class :character   Class :character   Class :character  
##  Mode  :character   Mode  :character   Mode  :character   Mode  :character  
##                                                                             
##                                                                             
##                                                                             
##    Winner       
##  Mode :logical  
##  FALSE:20435    
##  TRUE :4870     
##                 
##                 
## 
colSums(is.na(grammy_data))
##       ...1       Year   Ceremony   Award ID Award Type Award Name       Work 
##          0          0          0          0          0          0        893 
##    Nominee     Winner 
##          0          0
grammy <- grammy_data %>%
  rename_all(tolower)

grammy <- grammy %>% 
  clean_names()
names(grammy)
## [1] "x1"         "year"       "ceremony"   "award_id"   "award_type"
## [6] "award_name" "work"       "nominee"    "winner"
grammy <- grammy %>%
  select(year, award_name, nominee, winner)

grammy <- grammy %>%
  filter(!is.na(award_name), !is.na(nominee), !is.na(winner))

grammy <- grammy %>%
  mutate(
    category = str_trim(award_name),
    nominee = str_trim(nominee)
  )
write_csv(grammy, "grammy_clean.csv")
grammy_clean <- read_csv("grammy_clean.csv")
## Rows: 25305 Columns: 5
## ── Column specification ────────────────────────────────────────────────────────
## Delimiter: ","
## chr (3): award_name, nominee, category
## dbl (1): year
## lgl (1): winner
## 
## ℹ Use `spec()` to retrieve the full column specification for this data.
## ℹ Specify the column types or set `show_col_types = FALSE` to quiet this message.
grammy_clean <- grammy_clean %>%
  mutate(decade = floor(year / 10) * 10)

award_features <- grammy_clean %>%
  group_by(category) %>%
  summarise(
    total_nominations = n(),
    total_wins = sum(winner == TRUE),
    win_rate = total_wins / total_nominations,
    unique_nominees = n_distinct(nominee),
    years_active = n_distinct(year),
    most_frequent_nominee_count = max(table(nominee)),
    num_decades_active = n_distinct(decade),
    nominations_per_year = total_nominations/ years_active
  ) %>%
  ungroup() 

award_features
## # A tibble: 784 × 9
##    category   total_nominations total_wins win_rate unique_nominees years_active
##    <chr>                  <int>      <int>    <dbl>           <int>        <int>
##  1 Album Not…                10          2    0.2                10            2
##  2 Album Of …                21          4    0.190              20            4
##  3 Album Of …               356         65    0.183             242           64
##  4 Album Of …                16          3    0.188              15            3
##  5 Album Of …                29          5    0.172              25            5
##  6 Album Of …                 5          1    0.2                 5            1
##  7 Album Of …                14          2    0.143              14            2
##  8 Album Of …                55          8    0.145              42            8
##  9 Alternati…                10          2    0.2                10            2
## 10 Americana…                10          2    0.2                10            2
## # ℹ 774 more rows
## # ℹ 3 more variables: most_frequent_nominee_count <int>,
## #   num_decades_active <int>, nominations_per_year <dbl>
category_names <- award_features$category

feature_matrix <- award_features %>% select(-category)

feature_scaled <- scale(feature_matrix)
pca_results <- prcomp(feature_scaled, center = TRUE, scale. = TRUE)

fviz_eig(pca_results, addlabels = TRUE, barfill = "hotpink")

fviz_pca_biplot(pca_results, label = "var",
                repel = TRUE,
                title = "PCA Biplot")

pca_scores <- as.data.frame(pca_results$x)
pca_scores$category <- category_names
pca_scores
##             PC1           PC2           PC3           PC4           PC5
## 1   -1.10441568 -5.521760e-01  2.192519e-01  0.0535549841 -5.936641e-02
## 2   -0.63646246  1.058981e-02  4.893569e-02  0.1007589824 -2.770142e-01
## 3   13.84232552  1.032482e+00  2.353493e+00 -0.1488872510  2.320101e-01
## 4   -0.83861638  1.808546e-01 -1.130587e-02  0.1116063154 -1.788456e-01
## 5   -0.44887359  1.129798e+00  1.157197e-01  0.1195132948 -3.919756e-01
## 6   -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 7   -1.14986364  3.228596e+00  2.606076e-01 -0.1441052986 -1.339408e-01
## 8    0.84620923  3.098003e+00 -4.544196e-01 -0.1359444146  4.813318e-02
## 9   -1.10441568 -5.521760e-01  2.192519e-01  0.0535549841 -5.936641e-02
## 10  -1.10441568 -5.521760e-01  2.192519e-01  0.0535549841 -5.936641e-02
## 11  -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 12  -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 13  -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 14  -1.03244088 -5.487743e-01 -8.157084e-02  0.0517514739 -6.468404e-02
## 15   1.10416419  2.691945e+00  5.887499e-01 -0.0781609086  8.623294e-01
## 16  -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 17  -0.55262718  1.508296e+00 -2.229547e-01  0.0989742229 -3.279051e-01
## 18  -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 19  -0.84085132  3.240171e+00  3.821531e-02 -0.1469252033 -2.631048e-01
## 20  -1.14986364  3.228596e+00  2.606076e-01 -0.1441052986 -1.339408e-01
## 21  -1.14056787  2.386815e+00  2.501850e-01  0.0086343407 -1.138021e-01
## 22  -1.38690117  3.220422e+00  1.821770e-01 -0.1430889040 -1.009439e-02
## 23  -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 24  -1.10441568 -5.521760e-01  2.192519e-01  0.0535549841 -5.936641e-02
## 25  13.02411348  4.649273e-01  3.407404e+00 -0.0646890166 -7.623266e-01
## 26  -1.38690117  3.220422e+00  1.821770e-01 -0.1430889040 -1.009439e-02
## 27  -1.13035079  7.558061e+00  1.555190e-02 -1.7854515773 -2.615291e-01
## 28  -1.45695926  6.202100e+00  2.061978e-01 -1.1360884581 -7.126977e-02
## 29  -1.03244088 -5.487743e-01 -8.157084e-02  0.0517514739 -6.468404e-02
## 30   0.78918798 -4.836474e-01 -8.583535e-01  0.0198102110  2.073082e-01
## 31  -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 32   3.73228883  1.937392e+00  1.079848e+00  0.0194402751 -4.209006e-01
## 33  -1.03244088 -5.487743e-01 -8.157084e-02  0.0517514739 -6.468404e-02
## 34   4.64542861 -3.719960e-01  9.999571e-02 -0.0260403948  5.162148e-01
## 35   1.00278534 -7.088775e-01 -1.597409e-01 -0.0052339285  5.127946e-02
## 36   1.12667133 -6.856728e-01  2.015548e-01 -0.0009925920 -4.239121e-02
## 37   1.39938059 -1.000731e-01  3.116598e-01  0.0595097657 -2.076964e-01
## 38   2.08880027 -2.841279e-01  4.577251e-01  0.0179838620  5.306159e-01
## 39  -0.91059118  1.774528e-01  2.895169e-01  0.1134098255 -1.735280e-01
## 40  -0.10368043  1.530276e+00 -4.452700e-01  0.0743522197  5.355620e-01
## 41  -1.14986364  3.228596e+00  2.606076e-01 -0.1441052986 -1.339408e-01
## 42   1.86907387 -4.462638e-01 -2.445714e-01 -0.0025329408  6.947202e-01
## 43  -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 44  -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 45  -0.43665745 -5.229848e-01  7.209520e-02  0.0282250817  6.871165e-01
## 46  -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 47   1.34294763 -2.649631e-01 -3.522593e-01  0.0414384909 -1.153585e-01
## 48  -1.10441568 -5.521760e-01  2.192519e-01  0.0535549841 -5.936641e-02
## 49   1.19899803 -2.717666e-01  2.493862e-01  0.0450455111 -1.047233e-01
## 50   1.13542163 -4.770979e-01  5.557059e-01  0.0252346490 -1.043191e-01
## 51  -0.90790580 -5.464402e-01  2.797033e-01  0.0531811800 -1.582959e-01
## 52  -1.31492637  3.223824e+00 -1.186457e-01 -0.1448924141 -1.541202e-02
## 53  -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 54  -0.60322904 -1.115452e+00 -2.931301e-01 -0.0314739550 -2.267619e-01
## 55   5.69067833 -3.464277e-01  3.744607e-01 -0.0262786489  3.096644e-02
## 56  -0.71894601  5.352847e-01  3.227067e-01  0.1030981791  7.744870e-01
## 57  -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 58  -0.65057191 -5.380398e-01  3.197825e-02  0.0511709133 -2.535156e-01
## 59   3.58333336 -1.836075e-01  9.561145e-01  0.0187626025 -2.557802e-01
## 60  -0.11561248 -5.149148e-01  4.938206e-01  0.0292809836  4.945753e-01
## 61  -1.24450738 -3.119257e+00  1.476560e-01 -0.5191720619  5.467349e-02
## 62   1.13542163 -4.770979e-01  5.557059e-01  0.0252346490 -1.043191e-01
## 63  -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 64   9.04821175  1.421889e+00  2.263838e-01 -0.0018025341 -6.197996e-01
## 65  -1.42317377  4.773500e+00  1.941371e-01 -0.5774025980 -3.978224e-02
## 66  -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 67   1.61663700 -4.625088e-01  3.819515e-02  0.0217152583 -2.676764e-01
## 68  -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 69  -0.05597226 -5.218538e-01 -1.316120e-01  0.0492482762 -5.014574e-01
## 70   0.16720317 -1.701173e+00 -9.755105e-02 -0.1728853687  4.520538e-01
## 71   5.67431133 -4.035444e-01  5.737745e-01 -0.0429553346 -1.379935e-01
## 72   2.37068821  1.305692e+00 -8.874714e-02  0.0391933485  1.448826e+00
## 73  -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 74  -0.51131763  1.975064e-01  3.827316e-01  0.0902572374  6.772020e-01
## 75   1.25916284  3.926930e+00 -9.014542e-04 -0.3468418495  8.190732e-01
## 76   5.98781561  3.835762e-01  1.307845e+00  0.0270029188 -3.568485e-01
## 77  -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 78  -1.31492637  3.223824e+00 -1.186457e-01 -0.1448924141 -1.541202e-02
## 79  -1.05814939  1.490985e+00 -6.101383e-02  0.1021679317 -9.981161e-02
## 80   1.47302858 -1.002440e+00  6.417417e-01 -0.0483818277 -2.543192e-01
## 81  -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 82  -1.31492637  3.223824e+00 -1.186457e-01 -0.1448924141 -1.541202e-02
## 83   2.82324089 -4.208179e-01 -3.093198e-01 -0.0047020435  2.760015e-01
## 84   1.41394021  8.015788e-02  3.208568e-01  0.0726710034 -2.208722e-01
## 85  -0.77510700 -5.403739e-01 -3.292959e-01  0.0497412073 -1.599038e-01
## 86   1.49134638 -1.277677e-01  6.508415e-01  0.0590900061 -2.741198e-01
## 87  -1.31300966  6.208904e+00 -3.954477e-01 -1.1396954783 -8.190503e-02
## 88  -0.53247628  4.809009e+00 -1.472727e+00 -0.5900638008 -2.991609e-01
## 89   0.64074711  3.188237e-01 -6.031681e-01  0.0870223750  2.623543e-01
## 90  -0.85153088  8.578804e-01 -8.808518e-03  0.1259111471 -1.857173e-01
## 91  -1.04359168 -5.495115e-01 -8.892443e-02  0.0519185215 -5.565668e-02
## 92  -1.38690117  3.220422e+00  1.821770e-01 -0.1430889040 -1.009439e-02
## 93  -0.84172450  2.104889e+00  1.833531e-02  0.0448571010 -2.281224e-01
## 94  -1.38690117  3.220422e+00  1.821770e-01 -0.1430889040 -1.009439e-02
## 95  -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 96  -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 97  -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 98  -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 99  -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 100 -1.42317377  4.773500e+00  1.941371e-01 -0.5774025980 -3.978224e-02
## 101 -0.82515489  1.497655e+00 -3.291636e-01  0.1005045600 -1.713803e-01
## 102  0.63486413  1.559363e+00  7.294218e-02  0.0519470380  1.186889e+00
## 103  1.69218954  1.926965e+00  4.018562e-01  0.0216336396  6.477869e-01
## 104  1.39869661  2.386302e+00 -6.869653e-01 -0.0358747368  9.072772e-01
## 105 -1.13012419  1.487583e+00  2.398089e-01  0.1039714419 -9.449398e-02
## 106 -1.03244088 -5.487743e-01 -8.157084e-02  0.0517514739 -6.468404e-02
## 107 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 108 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 109 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 110 -1.27492310  1.484030e+00 -1.304548e-01  0.1028630311  1.157631e-02
## 111  3.15845345  2.939084e+00 -3.817120e+00 -0.1336835677  4.590707e-01
## 112 -1.42317377  4.773500e+00  1.941371e-01 -0.5774025980 -3.978224e-02
## 113 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 114 -0.14080116 -5.133944e-01 -4.985133e-01  0.0249124475  6.136613e-01
## 115 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 116 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 117  0.09087831  3.602537e+00 -1.766527e-02 -0.2482625543  3.369452e-01
## 118 -0.40372019  2.921924e+00 -1.814964e-01 -0.0818915262 -4.192504e-01
## 119 -0.70514213 -5.321224e-01  3.124666e-01  0.0304023959  7.913636e-01
## 120 -0.70514213 -5.321224e-01  3.124666e-01  0.0304023959  7.913636e-01
## 121 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 122 -1.38690117  3.220422e+00  1.821770e-01 -0.1430889040 -1.009439e-02
## 123 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 124 -1.38690117  3.220422e+00  1.821770e-01 -0.1430889040 -1.009439e-02
## 125 -0.48684751  2.418264e+00 -8.819521e-01 -0.0212311453  7.427395e-01
## 126 -1.24450738 -3.119257e+00  1.476560e-01 -0.5191720619  5.467349e-02
## 127 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 128 -0.83593100 -5.430384e-01 -2.111950e-02  0.0513776699 -1.636135e-01
## 129  3.45644590 -1.810320e-01 -7.996323e-01  0.0154737533  5.123507e-02
## 130 -1.04359168 -5.495115e-01 -8.892443e-02  0.0519185215 -5.565668e-02
## 131 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 132  3.92316014  1.918735e+00 -1.654407e+00  0.0145094410 -8.725680e-02
## 133 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 134  4.05461892 -8.268886e-02 -7.161543e-01  0.0018004121  8.628762e-01
## 135  0.38182369 -5.006102e-01 -3.612809e-01  0.0247933205  3.710371e-01
## 136 -0.63316733 -5.287207e-01  1.164386e-02  0.0285988858  7.860460e-01
## 137 -0.61683112 -1.722869e+00  1.506288e-03 -0.1707303754  8.010902e-01
## 138  4.49694646 -1.870943e-01 -1.257492e+00 -0.0120257268  7.304541e-01
## 139  0.99658477 -4.635313e-01 -5.916672e+00  0.0145598595 -4.678250e-01
## 140  0.70868557 -4.771384e-01 -4.713381e+00  0.0217738999 -4.465545e-01
## 141  5.15699117  4.674406e-02 -1.434618e+01 -0.0320877846 -5.941654e-01
## 142 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 143 -1.10441568 -5.521760e-01  2.192519e-01  0.0535549841 -5.936641e-02
## 144 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 145 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 146 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 147 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 148 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 149 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 150 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 151 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 152  4.97814815 -2.845538e-01  1.784991e-01 -0.0169716440  3.688277e-01
## 153 -0.21277596 -5.167961e-01 -1.976906e-01  0.0267159576  6.189789e-01
## 154  1.47167660 -4.720930e-01 -5.740152e-02  0.0238868763 -1.503207e-01
## 155  1.10538799  1.181230e-01  8.841687e-01  0.0792995132 -1.385929e-01
## 156 -1.08807948 -1.746324e+00  2.091144e-01 -0.1457742772 -4.432218e-02
## 157  2.34533453  7.717859e-03  9.034771e-01  0.0423142847  3.297955e-01
## 158  0.78734401 -2.413456e-01 -2.311185e-01  0.0495855904  1.598773e-01
## 159 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 160  2.07607772 -3.170126e-01 -5.641488e-01  0.0362916954 -3.533102e-01
## 161 -0.08306208 -9.746884e-01  1.614742e-01 -0.0341482080  5.300844e-01
## 162 -0.83593100 -5.430384e-01 -2.111950e-02  0.0513776699 -1.636135e-01
## 163 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 164  1.09588843 -4.810685e-01  1.813473e-01  0.0251016143 -1.936307e-02
## 165 -0.63316733 -5.287207e-01  1.164386e-02  0.0285988858  7.860460e-01
## 166  0.53355740 -5.046463e-01  4.974200e-02  0.0481268639 -7.982457e-01
## 167  0.04860823 -1.998174e-01 -4.083899e-01  0.0789579586 -5.383869e-01
## 168 -1.10441568 -5.521760e-01  2.192519e-01  0.0535549841 -5.936641e-02
## 169 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 170 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 171  0.15168843 -5.153807e-01 -6.380709e-02  0.0487074245 -6.094142e-01
## 172 -0.65057191 -5.380398e-01  3.197825e-02  0.0511709133 -2.535156e-01
## 173 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 174 -0.70514213 -5.321224e-01  3.124666e-01  0.0304023959  7.913636e-01
## 175  2.21495732 -3.091874e-01 -8.208500e-01  0.0334859001 -4.127920e-01
## 176 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 177 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 178 -0.64697121  5.386865e-01  2.188393e-02  0.1012946689  7.691693e-01
## 179 -0.63316733 -5.287207e-01  1.164386e-02  0.0285988858  7.860460e-01
## 180 -0.02251986 -5.196421e-01 -1.095513e-01  0.0487471335 -5.285395e-01
## 181 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 182 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 183 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 184 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 185 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 186 -1.06854636  5.171584e-01 -8.603795e-02  0.1247813522 -6.350595e-02
## 187 -0.47010985 -5.251965e-01  5.003443e-02  0.0287262243  7.141986e-01
## 188 -1.42317377  4.773500e+00  1.941371e-01 -0.5774025980 -3.978224e-02
## 189 -0.44505842  7.378198e-01  1.135552e-01  0.1254096797 -3.862716e-01
## 190 -1.04624476  5.186329e-01 -7.133078e-02  0.1244472571 -8.156068e-02
## 191 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 192 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 193 -0.56744631 -5.339008e-01 -2.614909e-01  0.0492003557 -2.678606e-01
## 194 -0.78625780 -5.411111e-01 -3.366494e-01  0.0499082548 -1.508764e-01
## 195 -1.06930019  1.490247e+00 -6.836742e-02  0.1023349793 -9.078425e-02
## 196 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 197  5.19830085 -1.300509e-01 -4.475011e-01 -0.0039565739  3.602089e-01
## 198  1.89915957 -4.556289e-01  7.828041e-01  0.0240735277 -4.819821e-01
## 199  2.02254157 -1.035025e-01 -1.785155e+00  0.0453301154 -2.805513e-01
## 200  7.87852926 -1.947220e-01 -1.487877e+00 -0.0623785607  1.603329e-01
## 201 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 202 -1.10441568 -5.521760e-01  2.192519e-01  0.0535549841 -5.936641e-02
## 203 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 204 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 205  4.90020675 -2.758447e-01 -1.475925e+00 -0.0239096301  5.761874e-01
## 206 -0.79740860 -5.418483e-01 -3.440030e-01  0.0500753024 -1.418490e-01
## 207 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 208 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 209  1.51899475 -3.001021e-01 -7.234069e-01  0.0401682104 -8.371479e-02
## 210 11.65657014  3.695299e-02  2.960083e+00 -0.0914185611 -4.830073e-02
## 211  0.27740729 -5.034431e-01  6.147233e-01  0.0285333754  2.967164e-01
## 212 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 213  0.77897412 -2.713225e-01 -1.181085e+00  0.0649690153 -7.875922e-01
## 214 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 215  4.81915633 -2.745843e-01 -2.505023e+00 -0.0270728355  7.403987e-01
## 216  4.56114416 -1.081473e-01 -9.386135e-01 -0.0020277778  6.872855e-01
## 217 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 218 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 219  4.15610529 -1.716012e-01  3.978206e-01 -0.0067941126  6.208295e-01
## 220  0.51243958 -4.965172e-01  3.522911e-01  0.0268572039  2.195514e-01
## 221 -0.91059118  1.774528e-01  2.895169e-01  0.1134098255 -1.735280e-01
## 222 -0.64013882  1.027704e+00  6.085282e-02  0.1225684722 -2.980560e-01
## 223 -1.03244088 -5.487743e-01 -8.157084e-02  0.0517514739 -6.468404e-02
## 224 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 225 -1.06859307  2.390217e+00 -5.063775e-02  0.0068308306 -1.191197e-01
## 226 -1.13012419  1.487583e+00  2.398089e-01  0.1039714419 -9.449398e-02
## 227 -0.28234169 -1.598996e-01  1.402167e-01  0.0871970313 -4.380462e-01
## 228  0.14661843 -5.143591e-01  2.811372e-01  0.0495086494 -6.582607e-01
## 229 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 230  4.96507394 -2.620579e-01  1.004867e+00 -0.0198044839  1.530153e-01
## 231  3.92725571 -1.922986e-01  1.392527e+00  0.0176993869 -4.663113e-01
## 232 -1.24450738 -3.119257e+00  1.476560e-01 -0.5191720619  5.467349e-02
## 233 -1.22895077 -5.545101e-01 -1.420222e-01  0.0521252780  3.424541e-02
## 234 -1.37783166  7.441460e+00 -4.820609e-02 -5.8608216424 -2.334459e-01
## 235 -0.65887584  1.511038e+00  3.220087e-02  0.0790153436  7.509184e-01
## 236 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 237  0.04582888  2.258967e+00 -6.327556e-02  0.0039951648  4.081952e-01
## 238 -0.70514213 -5.321224e-01  3.124666e-01  0.0304023959  7.913636e-01
## 239  4.44422004  1.165683e-01  8.599116e-01  0.0155666114  3.985248e-01
## 240 -1.39613526  6.204765e+00 -1.019786e-01 -1.1377249206 -6.756004e-02
## 241 -1.13012419  1.487583e+00  2.398089e-01  0.1039714419 -9.449398e-02
## 242  5.29448724  2.474697e+00 -1.146298e-01 -0.0681062425  2.025600e-02
## 243 -0.31945852  8.840003e-01 -5.245929e-01  0.0993185862  6.634048e-01
## 244 -1.10441568 -5.521760e-01  2.192519e-01  0.0535549841 -5.936641e-02
## 245 -0.65887584  1.511038e+00  3.220087e-02  0.0790153436  7.509184e-01
## 246 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 247 -1.38690117  3.220422e+00  1.821770e-01 -0.1430889040 -1.009439e-02
## 248 -1.13012419  1.487583e+00  2.398089e-01  0.1039714419 -9.449398e-02
## 249 -0.66991486  8.378093e-03  2.687492e-02  0.1012601250 -2.499321e-01
## 250  0.68301053  1.076737e+00 -2.229254e-01  0.0943520469  1.631097e-01
## 251 -0.77779238  1.835191e-01 -3.194822e-01  0.1099698529 -1.751359e-01
## 252 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 253  2.09770706 -4.592565e-01 -1.593415e+00  0.0185922921 -2.119037e-01
## 254  2.13025571 -3.983047e-02 -5.311552e-01  0.0602866175 -3.972892e-01
## 255  2.10344932 -3.165598e-01 -8.943859e-01  0.0351563755 -3.225184e-01
## 256 -1.03244088 -5.487743e-01 -8.157084e-02  0.0517514739 -6.468404e-02
## 257  1.01494575 -4.832342e-01 -8.477547e-01  0.0215683159  1.448598e-01
## 258  1.49641638 -1.287893e-01  3.058972e-01  0.0582887813 -2.252732e-01
## 259 -0.80285329  1.499129e+00 -3.144564e-01  0.1001704649 -1.894351e-01
## 260 -0.02469415  2.992460e+00 -7.046155e-01 -0.0971538322 -5.542510e-01
## 261 -0.37093643 -5.281649e-01 -2.010396e-01  0.0488265516 -3.667900e-01
## 262 -0.64013882  1.027704e+00  6.085282e-02  0.1225684722 -2.980560e-01
## 263  1.46052580 -4.728302e-01 -6.475511e-02  0.0240539238 -1.412933e-01
## 264 -0.18281054 -9.052662e-01 -1.499734e-01 -0.0017650133 -4.521674e-01
## 265 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 266  0.81437666 -4.851679e-01  1.339805e-01  0.0241787470  8.822220e-02
## 267 -1.06930019  1.490247e+00 -6.836742e-02  0.1023349793 -9.078425e-02
## 268 -0.84948983  4.292680e+00  5.080807e-02 -0.4205065558 -2.902459e-01
## 269  0.72394438 -7.443207e-01  7.325070e-02 -0.0063858271  1.646250e-01
## 270  0.11534894 -5.145975e-01 -1.063495e+00  0.0445059360 -4.813008e-01
## 271 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 272 -1.04624476  5.186329e-01 -7.133078e-02  0.1244472571 -8.156068e-02
## 273 -0.60089871 -5.361125e-01 -2.835517e-01  0.0497014983 -2.407785e-01
## 274 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 275 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 276 -0.38966963  2.028355e-01 -2.336211e-01  0.0869843122  6.846215e-01
## 277 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 278 -0.16428654 -5.244724e-01 -8.304768e-01  0.0468502977 -3.680264e-01
## 279 -0.37701723 -5.299238e-01 -5.533375e-01  0.0481923742 -3.089161e-01
## 280  0.30831944  2.243792e-01 -6.816910e-01  0.0827698222  4.098762e-01
## 281  1.16279323 -4.766451e-01  2.254688e-01  0.0240993290 -7.352725e-02
## 282  0.32708049 -5.015158e-01  2.991934e-01  0.0270639604  3.094535e-01
## 283 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 284 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 285 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 286 -1.10441568 -5.521760e-01  2.192519e-01  0.0535549841 -5.936641e-02
## 287  2.76342879 -3.064989e-01 -7.128627e-02  0.0130925384  3.320134e-01
## 288 -0.85823260 -5.445129e-01 -3.582668e-02  0.0517117649 -1.455588e-01
## 289 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 290 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 291  0.14361106 -8.904690e-01 -1.676148e+00 -0.0102814213 -4.516735e-01
## 292  9.64645264 -2.870050e-02  1.312655e-01 -0.0784273976  1.102972e-01
## 293 -1.22895077 -5.545101e-01 -1.420222e-01  0.0521252780  3.424541e-02
## 294 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 295  0.27740729 -5.034431e-01  6.147233e-01  0.0285333754  2.967164e-01
## 296  1.74969446 -2.684024e-01 -3.236228e-01  0.0191046924  7.899663e-01
## 297  1.82629708  6.927930e-01 -8.735318e-01  0.0900982096 -2.853846e-01
## 298 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 299  7.96844925  1.715674e-01  1.169205e+00 -0.0416717080  8.511821e-01
## 300 -1.22895077 -5.545101e-01 -1.420222e-01  0.0521252780  3.424541e-02
## 301  1.32078072 -4.720993e-01  6.088037e-01  0.0250278924 -1.942212e-01
## 302  1.78087827 -4.493812e-01  3.938420e-01  0.0002388417  6.602186e-01
## 303 -0.90410121 -1.326348e+00  2.699349e-01 -0.0630149403 -1.438736e-01
## 304 -1.10441568 -5.521760e-01  2.192519e-01  0.0535549841 -5.936641e-02
## 305 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 306 11.41455106 -9.630194e-02 -1.060142e+00 -0.0973506862 -5.195662e-01
## 307 -0.70514213 -5.321224e-01  3.124666e-01  0.0304023959  7.913636e-01
## 308  0.53202005 -2.545957e-01 -9.259787e-01  0.0691311584 -7.014879e-01
## 309 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 310 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 311 -1.42317377  4.773500e+00  1.941371e-01 -0.5774025980 -3.978224e-02
## 312 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 313 -0.58741023  2.405797e+00 -2.330034e-01  0.0039840166 -3.235622e-01
## 314 -0.84152353  2.684322e+00  2.826577e-02 -0.0392514249 -2.454431e-01
## 315 -1.38690117  3.220422e+00  1.821770e-01 -0.1430889040 -1.009439e-02
## 316 -1.42317377  4.773500e+00  1.941371e-01 -0.5774025980 -3.978224e-02
## 317 -1.06859307  2.390217e+00 -5.063775e-02  0.0068308306 -1.191197e-01
## 318 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 319 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 320 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 321 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 322 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 323  2.14433186 -4.507464e-01 -1.695167e-01  0.0207949064 -4.614540e-01
## 324  1.84948637 -4.575562e-01  1.098334e+00  0.0255429427 -4.947192e-01
## 325 -0.26004009 -1.584251e-01  1.549238e-01  0.0868629362 -4.561010e-01
## 326 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 327 -1.38690117  3.220422e+00  1.821770e-01 -0.1430889040 -1.009439e-02
## 328 -0.43934283  2.009082e-01  8.190883e-02  0.0884537273  6.718844e-01
## 329  0.79387971 -1.115289e-03 -5.741520e-01  0.0686926259  2.043665e-01
## 330  1.46153660 -4.700496e-01  6.324871e-01  0.0254893260 -2.480138e-01
## 331  0.54470820 -5.039090e-01  5.709559e-02  0.0479598164 -8.072731e-01
## 332 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 333  2.01355549 -2.723917e-01 -2.190656e-01  0.0163134193  6.369224e-01
## 334  1.98873295  6.343488e-02  4.597676e-01  0.0466396605  5.491526e-01
## 335  0.16283923 -5.146435e-01 -5.645350e-02  0.0485403770 -6.184416e-01
## 336 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 337  1.32907329 -6.950062e-01 -4.629456e-01 -0.0280184088  1.014048e+00
## 338 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 339  2.64176803 -4.364417e-01 -1.024618e+00  0.0163072432 -5.849922e-01
## 340 -1.10441568 -5.521760e-01  2.192519e-01  0.0535549841 -5.936641e-02
## 341 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 342 -1.06930019  1.490247e+00 -6.836742e-02  0.1023349793 -9.078425e-02
## 343 -1.42317377  4.773500e+00  1.941371e-01 -0.5774025980 -3.978224e-02
## 344 -1.38690117  3.220422e+00  1.821770e-01 -0.1430889040 -1.009439e-02
## 345 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 346 -1.13012419  1.487583e+00  2.398089e-01  0.1039714419 -9.449398e-02
## 347  0.02715334 -5.177148e-01 -4.250812e-01  0.0472777185 -5.158024e-01
## 348  0.02009300  4.050595e-01 -7.416226e-02  0.1166291545 -5.786362e-01
## 349 -0.20145131  1.997338e-01 -1.511994e-01  0.1090282879 -4.573006e-01
## 350 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 351 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 352 -1.42317377  4.773500e+00  1.941371e-01 -0.5774025980 -3.978224e-02
## 353 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 354 -1.22895077 -5.545101e-01 -1.420222e-01  0.0521252780  3.424541e-02
## 355 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 356  3.76205261 -4.036437e-01 -4.533350e-01 -0.0040710471 -7.012661e-02
## 357  1.61327114 -2.952258e-01 -1.009522e+00  0.0380306053 -1.070871e-01
## 358 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 359 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 360 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 361 -0.12947651  2.031355e-01 -4.520221e-01  0.1072247778 -4.626182e-01
## 362  0.85188826 -4.867584e-01 -8.861452e-01  0.0214409773  2.167071e-01
## 363  0.76876266 -4.908974e-01 -5.926761e-01  0.0234115350  2.310521e-01
## 364  3.81790375 -5.946767e-01  2.845488e-01 -0.0278679705 -2.235520e-01
## 365  0.46612605 -2.562386e-01 -2.728581e-01  0.0715688458 -7.540442e-01
## 366  3.92016411 -1.968381e-01  3.429868e-01  0.0156298074 -3.017169e-01
## 367 -0.27119089 -1.591624e-01  1.475703e-01  0.0870299838 -4.470736e-01
## 368  4.53959879 -1.934734e-01  9.448547e-02 -0.0079235046  5.444926e-01
## 369 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 370  1.96594886  3.213470e-01 -1.198530e+00  0.0787041948 -2.816476e-01
## 371  0.56877231  3.154220e-01 -3.023453e-01  0.0888258851  2.676719e-01
## 372  0.38705778 -1.824284e-01 -6.998837e-03  0.0574418331  3.086334e-01
## 373 -1.03244088 -5.487743e-01 -8.157084e-02  0.0517514739 -6.468404e-02
## 374  0.06833197 -8.048283e-01  2.277282e-01  0.0143135164 -5.907978e-01
## 375 -0.21036689 -1.564979e-01 -1.606061e-01  0.0853935212 -4.433639e-01
## 376 -0.88053420 -5.459873e-01 -5.053386e-02  0.0520458600 -1.275040e-01
## 377 -1.03244088 -5.487743e-01 -8.157084e-02  0.0517514739 -6.468404e-02
## 378  2.70103577 -5.758850e-01 -1.923059e+00 -0.0339839408  4.598538e-01
## 379  2.19641412 -1.754155e-01 -1.531011e+00  0.0456257832 -2.919385e-01
## 380  2.12575092 -3.150853e-01 -8.796787e-01  0.0348222804 -3.405731e-01
## 381  2.08756706 -4.572131e-01 -9.035268e-01  0.0201947418 -3.095968e-01
## 382 -1.04359168 -5.495115e-01 -8.892443e-02  0.0519185215 -5.565668e-02
## 383  1.00379495 -4.839715e-01 -8.551083e-01  0.0217353634  1.538871e-01
## 384 -0.45406203 -5.323039e-01  9.242959e-02  0.0507971092 -3.524450e-01
## 385 -0.85823260 -5.445129e-01 -3.582668e-02  0.0517117649 -1.455588e-01
## 386 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 387  6.14976508 -3.264901e-01 -5.377432e-01 -0.0525031018  9.921267e-01
## 388 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 389 -0.77130241 -1.320282e+00 -3.390642e-01 -0.0664549130 -1.454815e-01
## 390 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 391  1.04376349  9.883017e-01 -1.299336e-01  0.0959881826 -1.496280e-03
## 392 -0.79740860 -5.418483e-01 -3.440030e-01  0.0500753024 -1.418490e-01
## 393  0.17944767 -2.374664e-01 -3.921040e-01  0.0760962237 -5.830072e-01
## 394  1.73360731 -2.671921e-01 -1.209002e+00  0.0343410371 -2.121270e-01
## 395  1.55788981  8.696141e-02 -2.807888e-01  0.0690639832 -2.315075e-01
## 396 -0.24014756 -5.172489e-01  1.325465e-01  0.0278512776  5.881871e-01
## 397 -0.05478848 -5.122503e-01  1.856443e-01  0.0276445210  4.982850e-01
## 398 -0.10923871 -7.405918e-02  5.032998e-01  0.0713169194  4.805398e-01
## 399 -0.03726391 -7.065741e-02  2.024770e-01  0.0695134093  4.752222e-01
## 400 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 401  2.75430194 -3.648436e-02 -1.930724e+00  0.0479794095 -5.768779e-01
## 402 -0.11561248 -5.149148e-01  4.938206e-01  0.0292809836  4.945753e-01
## 403 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 404 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 405  2.61898215 -5.547679e-01  1.331024e+00  0.0099826418 -8.776105e-01
## 406  1.45646660 -4.690279e-01  9.774314e-01  0.0262905509 -2.968603e-01
## 407 -1.01610468 -1.742922e+00 -9.170841e-02 -0.1475777873 -4.963981e-02
## 408 -0.60482633 -1.731479e+00 -3.026789e-01 -0.1493064677 -2.132758e-01
## 409  0.50517500 -5.078796e-01 -3.172631e-01  0.0478267816 -7.223171e-01
## 410  5.86875326 -1.699124e-01 -2.092379e+00 -0.0258115713  1.334010e-01
## 411 -0.18401442  5.533043e-01 -1.637537e-01  0.0987563505  5.715891e-01
## 412 -1.22895077 -5.545101e-01 -1.420222e-01  0.0521252780  3.424541e-02
## 413 -0.90790580 -5.464402e-01  2.797033e-01  0.0531811800 -1.582959e-01
## 414 11.03688479  1.039844e+00  3.863855e+00 -0.0369085555  5.399843e-02
## 415 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 416 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 417 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 418 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 419 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 420 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 421  0.88020847 -2.628327e-01  8.053098e-01  0.0506329173 -1.328475e-02
## 422 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 423 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 424 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 425 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 426 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 427 -0.54007471 -5.334480e-01 -5.917280e-01  0.0480650357 -2.370687e-01
## 428 13.66830851  7.805453e-01  3.661034e+00 -0.0537984996 -1.136777e+00
## 429  6.45563758 -2.402314e-01  9.850841e-01 -0.0440137150  5.948578e-01
## 430 -0.38698425 -5.210575e-01 -2.434347e-01  0.0267556667  6.998536e-01
## 431 -1.24450738 -3.119257e+00  1.476560e-01 -0.5191720619  5.467349e-02
## 432 -1.10441568 -5.521760e-01  2.192519e-01  0.0535549841 -5.936641e-02
## 433 -0.25795937  1.514380e+00  1.726284e-01  0.1003898195 -4.911991e-01
## 434 -1.24450738 -3.119257e+00  1.476560e-01 -0.5191720619  5.467349e-02
## 435 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 436  0.22484701 -5.023755e-01 -4.737354e-02  0.0253001593  3.850105e-01
## 437 -0.84708180 -5.437756e-01 -2.847309e-02  0.0515447174 -1.545861e-01
## 438 -0.61683112 -1.722869e+00  1.506288e-03 -0.1707303754  8.010902e-01
## 439 -0.69162111  2.408796e+00  2.786977e-02 -0.0159876625  7.496650e-01
## 440 -1.38690117  3.220422e+00  1.821770e-01 -0.1430889040 -1.009439e-02
## 441 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 442 -1.38690117  3.220422e+00  1.821770e-01 -0.1430889040 -1.009439e-02
## 443 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 444 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 445  0.01600254 -5.184521e-01 -4.324348e-01  0.0474447660 -5.067750e-01
## 446 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 447 -1.06854636  5.171584e-01 -8.603795e-02  0.1247813522 -6.350595e-02
## 448 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 449 -0.08942466 -5.240656e-01 -1.536728e-01  0.0497494188 -4.743753e-01
## 450 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 451 -1.03244088 -5.487743e-01 -8.157084e-02  0.0517514739 -6.468404e-02
## 452 -0.39277775  2.126870e+00 -2.039799e-01  0.0202350978  6.353447e-01
## 453 -1.06930019  1.490247e+00 -6.836742e-02  0.1023349793 -9.078425e-02
## 454 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 455 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 456 -1.05739556  5.178957e-01 -7.868437e-02  0.1246143046 -7.253331e-02
## 457 -1.10441568 -5.521760e-01  2.192519e-01  0.0535549841 -5.936641e-02
## 458 -0.84708180 -5.437756e-01 -2.847309e-02  0.0515447174 -1.545861e-01
## 459 -1.27492310  1.484030e+00 -1.304548e-01  0.1028630311  1.157631e-02
## 460  2.97847604 -2.981484e-01 -2.893967e+00  0.0205146781 -5.394932e-01
## 461  0.21038222 -8.869715e-01 -4.090566e-01 -0.0255517788  4.564365e-01
## 462 -0.27985374 -5.280425e-01  1.381738e-01  0.0507574002 -4.333198e-01
## 463  1.94153623 -1.572738e-01  8.084616e-01  0.0535894086 -5.169476e-01
## 464 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 465  1.54710037 -1.240815e-01  6.876094e-01  0.0582547684 -3.192566e-01
## 466 -0.77510700 -5.403739e-01 -3.292959e-01  0.0497412073 -1.599038e-01
## 467  1.28631752 -4.770916e-01 -1.104993e-01  0.0240936328 -6.041860e-02
## 468  6.39902285 -3.831283e-01  9.668613e-03 -0.0410171567 -3.183262e-01
## 469 -0.90790580 -5.464402e-01  2.797033e-01  0.0531811800 -1.582959e-01
## 470 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 471 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 472 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 473 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 474  4.39381422 -2.081181e-01  7.957247e-01  0.0147737039 -5.570003e-01
## 475 -0.84708180 -5.437756e-01 -2.847309e-02  0.0515447174 -1.545861e-01
## 476  1.50655638 -1.308327e-01 -3.839914e-01  0.0566863315 -1.275801e-01
## 477  3.83097430 -1.086377e-01 -6.639722e-02  0.0251884514 -1.754009e-01
## 478 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 479 -0.26870294 -5.273053e-01  1.455273e-01  0.0505903527 -4.423471e-01
## 480 -1.03244088 -5.487743e-01 -8.157084e-02  0.0517514739 -6.468404e-02
## 481 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 482  3.70629861 -4.073299e-01 -4.901030e-01 -0.0032358094 -2.498979e-02
## 483  3.77522031 -1.123239e-01 -1.031652e-01  0.0260236891 -1.302641e-01
## 484  2.49991948 -3.084833e-01 -1.398821e+00  0.0294942500 -4.771919e-01
## 485 -1.10441568 -5.521760e-01  2.192519e-01  0.0535549841 -5.936641e-02
## 486 -0.44291123 -5.315667e-01  9.978318e-02  0.0506300617 -3.614724e-01
## 487  5.25506564 -1.235842e-01  2.865090e-01 -0.0033564094  2.083516e-01
## 488  2.94761042 -2.707231e-01  1.870006e-02 -0.0103815888  1.236112e+00
## 489 -0.70096282  1.025039e+00  3.690292e-01  0.1242049348 -3.017657e-01
## 490  1.48524181 -6.443898e-01  3.004299e-01  0.0030011074 -2.132598e-01
## 491  3.97490872 -2.909318e-01  3.306860e-02  0.0042366692 -2.942435e-01
## 492 -0.05073817 -2.036720e-01  2.226700e-01  0.0818967887 -5.638611e-01
## 493 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 494  3.86542232 -2.927430e-01  1.354017e+00  0.0087779490 -4.174108e-01
## 495 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 496  0.16790923 -5.156652e-01 -4.013978e-01  0.0477391521 -5.695950e-01
## 497 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 498  5.37644887  1.941144e-02 -3.886278e+00 -0.0138471498  5.581328e-01
## 499  4.76591776 -9.867924e-02 -1.848435e+00 -0.0072712606  6.803600e-01
## 500  5.09019244 -1.991732e-01 -9.854006e-02 -0.0110883700  3.327265e-01
## 501  2.51720099 -1.309855e-01 -3.751507e-01  0.0248932554  4.027856e-01
## 502  2.86954740 -4.304674e-01  3.804651e-01  0.0209361526 -8.608816e-01
## 503  2.40267764 -3.253625e-01 -4.873845e-01  0.0349427590 -4.969521e-01
## 504  3.24806485 -2.959035e-01  1.502916e+00  0.0125796238 -1.514633e-01
## 505  1.51729060 -4.663634e-01  6.692550e-01  0.0246540883 -2.931506e-01
## 506 -0.71139591 -5.407043e-01  3.401546e-01  0.0528073759 -2.572253e-01
## 507  7.36635416  6.152938e-01 -3.461734e+00 -0.0176143207  4.911000e-01
## 508 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 509  5.80285828 -1.730550e-01  1.277792e+00 -0.0155203183 -2.824564e-01
## 510 -0.90790580 -5.464402e-01  2.797033e-01  0.0531811800 -1.582959e-01
## 511  5.82558924  7.126187e-02 -5.986226e-01  0.0094773939  9.225739e-02
## 512  0.36057362 -8.287587e-01 -3.779639e-01 -0.0171293333  3.934735e-01
## 513 -1.08807948 -1.746324e+00  2.091144e-01 -0.1457742772 -4.432218e-02
## 514  1.19798723 -2.745472e-01 -4.478560e-01  0.0436101089  1.997194e-03
## 515  1.56088300 -4.661950e-01  1.427199e-03  0.0225504960 -2.225396e-01
## 516  0.90702978  1.700470e-01  8.237860e-01  0.0831606033 -3.991160e-02
## 517  1.66823592 -3.028754e-01  1.047045e+00  0.0429059475 -4.087799e-01
## 518 -1.03244088 -5.487743e-01 -8.157084e-02  0.0517514739 -6.468404e-02
## 519 -0.44210214  1.517993e+00  1.016418e-01  0.0783202442  6.395305e-01
## 520 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 521  0.06944108  6.973047e-01 -3.876870e-01  0.1210911670 -5.708064e-01
## 522 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 523 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 524 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 525  6.28858815 -2.369146e-01  7.659124e-01 -0.0274046191 -4.511430e-01
## 526 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 527 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 528 -0.63296117  5.313234e-01  5.856150e-02  0.1233783537 -2.918780e-01
## 529  5.38951964 -4.056612e-02  2.417492e-02  0.0008029615  1.541891e-01
## 530  1.54129635 -2.986276e-01 -7.086997e-01  0.0398341154 -1.017695e-01
## 531  5.61124764 -1.728647e-01 -1.844648e+00 -0.0232458110  2.286018e-01
## 532 -1.03244088 -5.487743e-01 -8.157084e-02  0.0517514739 -6.468404e-02
## 533 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 534 -0.65057191 -5.380398e-01  3.197825e-02  0.0511709133 -2.535156e-01
## 535  1.58005435  3.657586e-01  1.056150e-02  0.0873393833 -2.429578e-01
## 536  4.86626021 -1.985876e-01 -1.051718e+00  0.0052822204 -5.614304e-01
## 537 -0.86938340 -5.452501e-01 -4.318027e-02  0.0518788125 -1.365314e-01
## 538  6.34417760 -1.678097e-01 -2.451479e-01 -0.0230625523 -3.353517e-01
## 539 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 540 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 541  1.65200399 -2.535880e-01 -1.015116e+00  0.0181868809  9.143109e-01
## 542 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 543  1.62196567 -2.754904e-01 -5.956799e-02  0.0217434402  8.404208e-01
## 544 -1.11821956  5.152312e-01  2.294920e-01  0.1262507672 -7.624305e-02
## 545 -0.83593100 -5.430384e-01 -2.111950e-02  0.0513776699 -1.636135e-01
## 546  1.20113423 -8.944928e-01 -4.460620e-01 -0.0335707939  5.128263e-03
## 547 -1.04624476  5.186329e-01 -7.133078e-02  0.1244472571 -8.156068e-02
## 548 -1.03244088 -5.487743e-01 -8.157084e-02  0.0517514739 -6.468404e-02
## 549 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 550 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 551 -0.83593100 -5.430384e-01 -2.111950e-02  0.0513776699 -1.636135e-01
## 552 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 553 -0.91059118  1.774528e-01  2.895169e-01  0.1134098255 -1.735280e-01
## 554  0.86693695 -4.862355e-01  7.960774e-01  0.0274119632 -7.199152e-05
## 555 -1.03244088 -5.487743e-01 -8.157084e-02  0.0517514739 -6.468404e-02
## 556 -0.34834186 -8.759366e-02 -5.291512e-01  0.0898942149 -3.410063e-01
## 557 -0.44768826 -9.144823e-02  1.019087e-01  0.0928330450 -3.664805e-01
## 558 -0.76395620 -5.396366e-01 -3.219423e-01  0.0495741597 -1.689311e-01
## 559  0.94831774 -4.325548e-02  1.540718e-01  0.0668559637  3.501774e-02
## 560 -0.84708180 -5.437756e-01 -2.847309e-02  0.0515447174 -1.545861e-01
## 561  2.11814404 -4.415956e-01  4.779768e-01  0.0003264712  5.074965e-01
## 562 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 563 -0.63942111 -5.373025e-01  3.933184e-02  0.0510038658 -2.625429e-01
## 564  0.97024245  3.819669e-01  5.174993e-01  0.0915132617 -4.058114e-02
## 565 -0.10853254 -5.207862e-01 -7.937089e-01  0.0460150600 -4.131632e-01
## 566 -1.08045099  1.489510e+00 -7.572101e-02  0.1025020268 -8.175688e-02
## 567 -1.10441568 -5.521760e-01  2.192519e-01  0.0535549841 -5.936641e-02
## 568 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 569 -0.90790580 -5.464402e-01  2.797033e-01  0.0531811800 -1.582959e-01
## 570 -0.50863225 -5.263866e-01  3.729180e-01  0.0300285918  6.924342e-01
## 571 -0.51488603 -5.349684e-01  4.006059e-01  0.0524335718 -3.561548e-01
## 572  1.51630306  2.046795e-01  1.014149e+00  0.0826446567 -3.492292e-01
## 573  0.10178437 -8.026166e-01  2.497890e-01  0.0138123737 -6.178799e-01
## 574 -0.90790580 -5.464402e-01  2.797033e-01  0.0531811800 -1.582959e-01
## 575  0.83194721 -2.383967e-01 -2.017041e-01  0.0489174003  1.237679e-01
## 576 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 577 -1.10441568 -5.521760e-01  2.192519e-01  0.0535549841 -5.936641e-02
## 578 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 579 -1.11821956  5.152312e-01  2.294920e-01  0.1262507672 -7.624305e-02
## 580 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 581  0.18667144  2.190501e-01 -6.533826e-02  0.0860427473  4.024568e-01
## 582 -0.03904569 -1.492415e-01 -1.092489e+00  0.0806511810 -4.232073e-01
## 583 -0.31011243 -5.255004e-01 -5.092159e-01  0.0471900890 -3.630803e-01
## 584  0.29433386 -1.308308e-01 -3.461534e-01  0.0599362803  3.749664e-01
## 585 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 586 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 587 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 588 -1.01610468 -1.742922e+00 -9.170841e-02 -0.1475777873 -4.963981e-02
## 589 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 590 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 591 -1.03765825 -1.294720e+01  1.291721e-01 -6.3666416344  1.686655e-02
## 592 -1.08500117 -5.477066e-01 -7.436677e-01  0.0485182578  2.361015e-02
## 593 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 594 -0.77779238  1.835191e-01 -3.194822e-01  0.1099698529 -1.751359e-01
## 595 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 596 -0.83212641 -1.322946e+00 -3.088783e-02 -0.0648184504 -1.491912e-01
## 597 -1.24450738 -3.119257e+00  1.476560e-01 -0.5191720619  5.467349e-02
## 598  1.36437312 -4.719309e-01 -5.902414e-02  0.0229243001 -1.236101e-01
## 599  1.02102655 -4.814753e-01 -4.954568e-01  0.0222024932  8.698585e-02
## 600  0.74747186 -4.895913e-01  8.985895e-02  0.0251810323  1.423864e-01
## 601 -0.63942111 -5.373025e-01  3.933184e-02  0.0510038658 -2.625429e-01
## 602  0.94610247 -2.611898e-01  1.521892e-01  0.0481952299  3.927154e-02
## 603  2.48973113 -1.753282e-01 -3.622084e-01  0.0445049590 -6.276221e-01
## 604 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 605 -0.28823773 -9.108796e-01  1.287885e-01  0.0005396394 -4.197677e-01
## 606  0.58441438 -4.931154e-01  5.146838e-02  0.0250536937  2.142337e-01
## 607 -0.84708180 -5.437756e-01 -2.847309e-02  0.0515447174 -1.545861e-01
## 608  1.15439483 -2.747156e-01  2.199718e-01  0.0457137013 -6.861382e-02
## 609  0.57886952  5.841211e-01  3.748832e-01  0.0760042739  1.199265e+00
## 610  1.34636171 -2.846538e-01  6.253490e-01  0.0444939076 -2.163307e-01
## 611  0.50010500 -5.068580e-01  2.768124e-02  0.0486280065 -7.711636e-01
## 612 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 613 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 614  5.12765478 -3.546263e-01  2.797271e-01 -0.0281243833  2.461370e-01
## 615  0.78880971 -9.361987e-05 -2.292077e-01  0.0694938508  1.555199e-01
## 616  2.87185167 -7.812830e-02 -5.992221e-01  0.0509314979 -7.623387e-01
## 617  0.07323329 -6.606560e-02 -4.212293e-01  0.0664075316  4.916690e-01
## 618 -0.63942111 -5.373025e-01  3.933184e-02  0.0510038658 -2.625429e-01
## 619 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 620  3.93945461 -3.946284e-01 -1.032920e+00 -0.0081792099 -1.078440e-01
## 621  0.32300963 -5.081244e-01 -9.956897e-01  0.0439650844 -5.892576e-01
## 622  1.43556861 -6.463171e-01  6.159598e-01  0.0044705224 -2.259969e-01
## 623 -1.10441568 -5.521760e-01  2.192519e-01  0.0535549841 -5.936641e-02
## 624  0.93283095 -4.845927e-01  1.429567e-01  0.0249742757  5.248429e-02
## 625  2.17060896  1.370220e-01 -1.132590e+00  0.0677155041 -3.853360e-01
## 626 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 627 -0.25755214 -5.265680e-01  1.528809e-01  0.0504233051 -4.513745e-01
## 628 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 629 -0.09449466 -5.230439e-01  1.912715e-01  0.0505506437 -5.232218e-01
## 630  3.65646761 -2.806739e-01  2.089999e-01 -0.0136108164  9.036803e-01
## 631  1.73628667  2.110826e-01 -9.305058e-01  0.0749974993 -2.096151e-01
## 632  0.15139588 -1.094464e+00 -6.766792e-02 -0.0324808285 -6.009939e-01
## 633  0.12431683 -5.158336e-01  2.664300e-01  0.0498427445 -6.402060e-01
## 634 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 635 -1.13012419  1.487583e+00  2.398089e-01  0.1039714419 -9.449398e-02
## 636 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 637 -0.51488603 -5.349684e-01  4.006059e-01  0.0524335718 -3.561548e-01
## 638 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 639 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 640 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 641 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 642  0.38182369 -5.006102e-01 -3.612809e-01  0.0247933205  3.710371e-01
## 643  0.55837898 -1.751720e-01 -9.388815e-01  0.0526994929  3.287899e-01
## 644 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 645 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 646 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 647  3.23485892 -5.270846e-01  1.049188e-01 -0.0159956519  6.955839e-02
## 648 -0.76840528  8.620194e-01 -3.022777e-01  0.1239405894 -2.000623e-01
## 649 -1.04624476  5.186329e-01 -7.133078e-02  0.1244472571 -8.156068e-02
## 650 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 651 -1.10441568 -5.521760e-01  2.192519e-01  0.0535549841 -5.936641e-02
## 652 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 653 -1.22895077 -5.545101e-01 -1.420222e-01  0.0521252780  3.424541e-02
## 654 -1.10441568 -5.521760e-01  2.192519e-01  0.0535549841 -5.936641e-02
## 655 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 656 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 657 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 658  3.12229199 -2.922707e-01 -2.272642e+00  0.0026395856  4.121457e-01
## 659 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 660 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 661 -1.03244088 -5.487743e-01 -8.157084e-02  0.0517514739 -6.468404e-02
## 662 -0.68371768 -5.325027e-01 -1.593038e+00  0.0429009709 -8.224483e-02
## 663 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 664 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 665 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 666 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 667 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 668 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 669 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 670 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 671 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 672 -1.04624476  5.186329e-01 -7.133078e-02  0.1244472571 -8.156068e-02
## 673 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 674 -1.24450738 -3.119257e+00  1.476560e-01 -0.5191720619  5.467349e-02
## 675 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 676 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 677 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 678 -1.13012419  1.487583e+00  2.398089e-01  0.1039714419 -9.449398e-02
## 679 -1.04624476  5.186329e-01 -7.133078e-02  0.1244472571 -8.156068e-02
## 680 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 681 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 682 -1.08807948 -1.746324e+00  2.091144e-01 -0.1457742772 -4.432218e-02
## 683 -1.10441568 -5.521760e-01  2.192519e-01  0.0535549841 -5.936641e-02
## 684 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 685 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 686 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 687 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 688 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 689 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 690 -1.10441568 -5.521760e-01  2.192519e-01  0.0535549841 -5.936641e-02
## 691 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 692 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 693 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 694 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 695 -1.10441568 -5.521760e-01  2.192519e-01  0.0535549841 -5.936641e-02
## 696 -1.10441568 -5.521760e-01  2.192519e-01  0.0535549841 -5.936641e-02
## 697 -1.10441568 -5.521760e-01  2.192519e-01  0.0535549841 -5.936641e-02
## 698 -1.10441568 -5.521760e-01  2.192519e-01  0.0535549841 -5.936641e-02
## 699 -1.10441568 -5.521760e-01  2.192519e-01  0.0535549841 -5.936641e-02
## 700 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 701 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 702 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 703 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 704 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 705 -1.10441568 -5.521760e-01  2.192519e-01  0.0535549841 -5.936641e-02
## 706 -1.10441568 -5.521760e-01  2.192519e-01  0.0535549841 -5.936641e-02
## 707 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 708 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 709 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 710 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 711 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 712 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 713 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 714 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 715 -0.91059118  1.774528e-01  2.895169e-01  0.1134098255 -1.735280e-01
## 716 -1.10441568 -5.521760e-01  2.192519e-01  0.0535549841 -5.936641e-02
## 717 -1.11821956  5.152312e-01  2.294920e-01  0.1262507672 -7.624305e-02
## 718 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 719 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 720 -1.16719747 -6.726214e+00  1.373570e-01 -2.1369991058  5.466664e-02
## 721 -1.24450738 -3.119257e+00  1.476560e-01 -0.5191720619  5.467349e-02
## 722 -1.04359168 -5.495115e-01 -8.892443e-02  0.0519185215 -5.565668e-02
## 723 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 724 -1.10441568 -5.521760e-01  2.192519e-01  0.0535549841 -5.936641e-02
## 725 -1.10441568 -5.521760e-01  2.192519e-01  0.0535549841 -5.936641e-02
## 726 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 727 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 728 -1.10441568 -5.521760e-01  2.192519e-01  0.0535549841 -5.936641e-02
## 729 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 730 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 731 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 732 -1.03244088 -5.487743e-01 -8.157084e-02  0.0517514739 -6.468404e-02
## 733 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 734  0.97292477 -1.963375e-01  1.392697e-01  0.0305922723  1.069606e+00
## 735  0.94196134 -7.115420e-01  1.484355e-01 -0.0035974659  4.756973e-02
## 736 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 737  5.15859856 -2.821214e-01 -2.140514e+00 -0.0247518362  5.933978e-01
## 738  6.23171666 -2.328377e-01  8.748913e-01 -0.0648037494  1.769436e+00
## 739 -1.10441568 -5.521760e-01  2.192519e-01  0.0535549841 -5.936641e-02
## 740 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 741 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 742 -1.10441568 -5.521760e-01  2.192519e-01  0.0535549841 -5.936641e-02
## 743 -1.10441568 -5.521760e-01  2.192519e-01  0.0535549841 -5.936641e-02
## 744 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 745 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 746 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 747 -1.11821956  5.152312e-01  2.294920e-01  0.1262507672 -7.624305e-02
## 748 -1.11821956  5.152312e-01  2.294920e-01  0.1262507672 -7.624305e-02
## 749 14.40634919  8.165875e-01  2.922997e+00 -0.0693745557 -1.427803e-01
## 750 -1.10441568 -5.521760e-01  2.192519e-01  0.0535549841 -5.936641e-02
## 751 -1.11821956  5.152312e-01  2.294920e-01  0.1262507672 -7.624305e-02
## 752 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 753 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 754 -0.26244916 -5.187234e-01  1.178394e-01  0.0281853727  6.062418e-01
## 755 -1.03244088 -5.487743e-01 -8.157084e-02  0.0517514739 -6.468404e-02
## 756 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 757 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 758 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 759 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 760 -1.03244088 -5.487743e-01 -8.157084e-02  0.0517514739 -6.468404e-02
## 761 -1.03244088 -5.487743e-01 -8.157084e-02  0.0517514739 -6.468404e-02
## 762 -1.10441568 -5.521760e-01  2.192519e-01  0.0535549841 -5.936641e-02
## 763 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 764 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 765 14.98620509  9.176743e-01  3.646323e+00 -0.0751902767 -6.591795e-01
## 766 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 767 -0.90790580 -5.464402e-01  2.797033e-01  0.0531811800 -1.582959e-01
## 768 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 769 -1.11821956  5.152312e-01  2.294920e-01  0.1262507672 -7.624305e-02
## 770 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 771 -1.10441568 -5.521760e-01  2.192519e-01  0.0535549841 -5.936641e-02
## 772 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 773 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 774 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 775 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 776 -1.03244088 -5.487743e-01 -8.157084e-02  0.0517514739 -6.468404e-02
## 777 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 778 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 779 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 780 -1.06826131 -3.114740e+00  1.991177e-01 -0.5192245707 -3.179749e-02
## 781 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 782 -0.96046608 -5.453725e-01 -3.823936e-01  0.0499479638 -7.000167e-02
## 783 -1.24450738 -3.119257e+00  1.476560e-01 -0.5191720619  5.467349e-02
## 784 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
##              PC6           PC7           PC8
## 1   -0.002080531  0.0055937328  4.271075e-04
## 2    0.031270144  0.0035345606  4.657184e-04
## 3   -0.813138195  0.3562872903  6.510375e-02
## 4    0.028419375  0.0041968610  4.942512e-04
## 5   -0.010545411  0.0314829778 -4.465146e-04
## 6   -0.001195833  0.0094399247  4.560014e-04
## 7   -0.025322045 -0.0033065491 -2.168011e-03
## 8    0.198438410  0.1521511761 -3.471927e-03
## 9   -0.002080531  0.0055937328  4.271075e-04
## 10  -0.002080531  0.0055937328  4.271075e-04
## 11  -0.001195833  0.0094399247  4.560014e-04
## 12  -0.001195833  0.0094399247  4.560014e-04
## 13  -0.029819286 -0.0122167983 -2.921271e-05
## 14   0.029044455  0.0050494016  5.911406e-04
## 15   0.392563612  0.1040706497 -2.312698e-03
## 16  -0.001195833  0.0094399247  4.560014e-04
## 17   0.075981461  0.0228360711 -2.360800e-04
## 18  -0.029819286 -0.0122167983 -2.921271e-05
## 19   0.035721489  0.0240896662 -2.331707e-03
## 20  -0.025322045 -0.0033065491 -2.168011e-03
## 21  -0.020620101 -0.0019906260 -1.060281e-03
## 22  -0.055240594 -0.0312470955 -1.840283e-03
## 23  -0.029819286 -0.0122167983 -2.921271e-05
## 24  -0.002080531  0.0055937328  4.271075e-04
## 25   0.659821155 -0.0416891855 -2.572469e-03
## 26  -0.055240594 -0.0312470955 -1.840283e-03
## 27  -0.035654025 -0.0038182748 -1.193390e-02
## 28  -0.100746304 -0.0649303134 -7.672183e-03
## 29   0.029044455  0.0050494016  5.911406e-04
## 30   0.183433260 -0.0264014910  1.024844e-03
## 31  -0.001195833  0.0094399247  4.560014e-04
## 32   0.523583558  0.2376829480 -3.461505e-03
## 33   0.029044455  0.0050494016  5.911406e-04
## 34  -0.497249235 -0.0532818701 -2.074653e-03
## 35   0.066657686 -0.0418089872  5.760251e-04
## 36   0.034222591 -0.0454728677  3.904725e-04
## 37   0.130688312 -0.0164360974  2.580062e-04
## 38   0.069044535 -0.0362587346 -1.507797e-05
## 39  -0.002705611  0.0047411921  3.302181e-04
## 40   0.184312188  0.0129671003  2.067384e-05
## 41  -0.025322045 -0.0033065491 -2.168011e-03
## 42   0.204970879 -0.0490024557  7.670623e-04
## 43  -0.001195833  0.0094399247  4.560014e-04
## 44  -0.029819286 -0.0122167983 -2.921271e-05
## 45   0.147374185 -0.0112496533  7.967547e-04
## 46  -0.001195833  0.0094399247  4.560014e-04
## 47   0.202880271 -0.0281934634  8.113044e-04
## 48  -0.002080531  0.0055937328  4.271075e-04
## 49   0.140630300 -0.0271048011  4.832383e-04
## 50   0.140296598 -0.0420191890  5.656039e-04
## 51  -0.002965229  0.0017475408  3.982137e-04
## 52  -0.024115609 -0.0317914267 -1.676250e-03
## 53  -0.029819286 -0.0122167983 -2.921271e-05
## 54  -0.008271007 -0.0043960554  4.127760e-04
## 55  -0.754609550 -0.0575896818 -3.098739e-03
## 56   0.110013551 -0.0101586476  5.552314e-04
## 57  -0.001195833  0.0094399247  4.560014e-04
## 58   0.006270714 -0.0010788706  4.624593e-04
## 59   0.266201189 -0.0622949985  2.810815e-04
## 60   0.114479803 -0.0183977061  5.749339e-04
## 61   0.033031373  0.0356928932 -1.379033e-03
## 62   0.140296598 -0.0420191890  5.656039e-04
## 63  -0.001195833  0.0094399247  4.560014e-04
## 64   0.121628890  0.3715153511 -6.989459e-03
## 65  -0.078660562 -0.0486358765 -4.480013e-03
## 66  -0.029819286 -0.0122167983 -2.921271e-05
## 67   0.095755454 -0.0429796769  4.814146e-04
## 68  -0.029819286 -0.0122167983 -2.921271e-05
## 69  -0.091284458 -0.0037771076  1.144496e-04
## 70   0.090507629 -0.0460132050  5.041598e-04
## 71   0.347471761 -0.1434815253  8.729611e-04
## 72   0.357229760  0.0722242077 -9.455198e-04
## 73  -0.029819286 -0.0122167983 -2.921271e-05
## 74   0.116508819 -0.0077116709  5.647260e-04
## 75   0.391422968  0.1822254811 -4.901744e-03
## 76   0.184557738  0.0296599484 -1.903251e-03
## 77  -0.029819286 -0.0122167983 -2.921271e-05
## 78  -0.024115609 -0.0317914267 -1.676250e-03
## 79   0.015822625 -0.0007139522 -4.349079e-05
## 80   0.082145065 -0.0866147194  6.863091e-04
## 81  -0.029819286 -0.0122167983 -2.921271e-05
## 82  -0.024115609 -0.0317914267 -1.676250e-03
## 83   0.042633279 -0.0547007415  1.485841e-04
## 84   0.142322188 -0.0037530958  1.215933e-04
## 85   0.038280398  0.0022229902  6.553863e-04
## 86   0.036248215 -0.0145492887 -1.508296e-04
## 87  -0.038496333 -0.0660189757 -7.344117e-03
## 88   0.093707976  0.0435865263 -4.804574e-03
## 89  -0.028528395  0.0229819446 -2.199536e-04
## 90   0.008169099  0.0091601751  1.506343e-04
## 91   0.008040111  0.0066135133  5.202470e-04
## 92  -0.055240594 -0.0312470955 -1.840283e-03
## 93   0.031852640  0.0153549838 -8.088004e-04
## 94  -0.055240594 -0.0312470955 -1.840283e-03
## 95  -0.029819286 -0.0122167983 -2.921271e-05
## 96  -0.001195833  0.0094399247  4.560014e-04
## 97  -0.001195833  0.0094399247  4.560014e-04
## 98  -0.001195833  0.0094399247  4.560014e-04
## 99  -0.001195833  0.0094399247  4.560014e-04
## 100 -0.078660562 -0.0486358765 -4.480013e-03
## 101 -0.043557183  0.0186094522 -4.122367e-04
## 102  0.259426795  0.0282811463 -4.072608e-04
## 103  0.250177956  0.1216165649 -2.174474e-03
## 104  0.145447964  0.1324875221 -2.651789e-03
## 105 -0.015302360 -0.0001696211 -2.075239e-04
## 106  0.029044455  0.0050494016  5.911406e-04
## 107 -0.001195833  0.0094399247  4.560014e-04
## 108 -0.029819286 -0.0122167983 -2.921271e-05
## 109 -0.001195833  0.0094399247  4.560014e-04
## 110  0.001305700 -0.0127611295  1.348204e-04
## 111 -0.190161446  0.3641369228 -6.380613e-03
## 112 -0.078660562 -0.0486358765 -4.480013e-03
## 113 -0.029819286 -0.0122167983 -2.921271e-05
## 114  0.124722083 -0.0099280609  8.123527e-04
## 115 -0.029819286 -0.0122167983 -2.921271e-05
## 116 -0.001195833  0.0094399247  4.560014e-04
## 117  0.211393196  0.0792292931 -3.322646e-03
## 118 -0.069780920  0.0844403015 -2.901433e-03
## 119  0.117133898 -0.0068591302  6.616154e-04
## 120  0.117133898 -0.0068591302  6.616154e-04
## 121 -0.029819286 -0.0122167983 -2.921271e-05
## 122 -0.055240594 -0.0312470955 -1.840283e-03
## 123 -0.029819286 -0.0122167983 -2.921271e-05
## 124 -0.055240594 -0.0312470955 -1.840283e-03
## 125  0.160081238 -0.0119284786 -3.823219e-04
## 126  0.033031373  0.0356928932 -1.379033e-03
## 127 -0.001195833  0.0094399247  4.560014e-04
## 128  0.028159756  0.0012032097  5.622467e-04
## 129 -0.123620011 -0.0206891308 -7.112771e-04
## 130  0.008040111  0.0066135133  5.202470e-04
## 131 -0.001195833  0.0094399247  4.560014e-04
## 132 -0.346836215  0.3300922022 -6.146580e-03
## 133 -0.001195833  0.0094399247  4.560014e-04
## 134 -0.391515989  0.0033631068 -2.018654e-03
## 135 -0.003958075 -0.0120819667  3.003099e-04
## 136  0.148258884 -0.0074034614  8.256485e-04
## 137  0.156737716 -0.0029897026  3.695482e-04
## 138 -0.491044231 -0.0082986035 -2.114071e-03
## 139  0.648890069 -0.0173757972  3.785121e-03
## 140  0.524390127 -0.0151984726  3.128988e-03
## 141  1.718523550 -0.0511505160  8.476185e-03
## 142 -0.001195833  0.0094399247  4.560014e-04
## 143 -0.002080531  0.0055937328  4.271075e-04
## 144 -0.001195833  0.0094399247  4.560014e-04
## 145 -0.001195833  0.0094399247  4.560014e-04
## 146 -0.029819286 -0.0122167983 -2.921271e-05
## 147 -0.001195833  0.0094399247  4.560014e-04
## 148 -0.001195833  0.0094399247  4.560014e-04
## 149 -0.001195833  0.0094399247  4.560014e-04
## 150 -0.001195833  0.0094399247  4.560014e-04
## 151 -0.001195833  0.0094399247  4.560014e-04
## 152 -0.632296386 -0.0355360444 -2.758369e-03
## 153  0.093597097 -0.0093837297  6.483197e-04
## 154 -0.177301015 -0.0226462250 -4.402016e-04
## 155  0.142948046 -0.0043814835  3.630206e-05
## 156  0.006398301  0.0100074915 -2.899282e-05
## 157  0.251018556 -0.0268413532  1.701225e-04
## 158  0.004565907 -0.0082308465  1.454655e-04
## 159 -0.001195833  0.0094399247  4.560014e-04
## 160 -0.378241269 -0.0014999175 -1.237128e-03
## 161  0.076555524 -0.0221734284  5.108382e-04
## 162  0.028159756  0.0012032097  5.622467e-04
## 163 -0.029819286 -0.0122167983 -2.921271e-05
## 164 -0.038621854 -0.0269224034  2.070142e-05
## 165  0.148258884 -0.0074034614  8.256485e-04
## 166 -0.093938553 -0.0153156835  2.776802e-05
## 167 -0.009305304  0.0028605394  3.333695e-04
## 168 -0.002080531  0.0055937328  4.271075e-04
## 169 -0.001195833  0.0094399247  4.560014e-04
## 170 -0.001195833  0.0094399247  4.560014e-04
## 171 -0.071164813 -0.0091874112  1.564493e-04
## 172  0.006270714 -0.0010788706  4.624593e-04
## 173 -0.001195833  0.0094399247  4.560014e-04
## 174  0.117133898 -0.0068591302  6.616154e-04
## 175 -0.221090221 -0.0114289187 -6.477340e-04
## 176 -0.001195833  0.0094399247  4.560014e-04
## 177 -0.001195833  0.0094399247  4.560014e-04
## 178  0.141138537 -0.0107029788  7.192645e-04
## 179  0.148258884 -0.0074034614  8.256485e-04
## 180 -0.028271427 -0.0084694426  3.271302e-04
## 181 -0.001195833  0.0094399247  4.560014e-04
## 182 -0.001195833  0.0094399247  4.560014e-04
## 183 -0.029819286 -0.0122167983 -2.921271e-05
## 184 -0.001195833  0.0094399247  4.560014e-04
## 185 -0.001195833  0.0094399247  4.560014e-04
## 186 -0.020084580  0.0048781076  3.429694e-04
## 187  0.084361154 -0.0065573183  5.840740e-04
## 188 -0.078660562 -0.0486358765 -4.480013e-03
## 189  0.003691175  0.0213951375 -8.817964e-05
## 190  0.021924108  0.0017498842  4.847565e-04
## 191 -0.001195833  0.0094399247  4.560014e-04
## 192 -0.001195833  0.0094399247  4.560014e-04
## 193  0.058400043 -0.0031873134  6.973860e-04
## 194  0.017276054  0.0037871019  5.844927e-04
## 195 -0.005181719  0.0008501594 -1.143843e-04
## 196 -0.001195833  0.0094399247  4.560014e-04
## 197 -0.837297704  0.0105657940 -3.720689e-03
## 198  0.094749117 -0.0542757335  3.082414e-04
## 199  0.201230723 -0.0126474911  8.778607e-04
## 200  0.022416932 -0.1085158601 -4.836760e-04
## 201 -0.001195833  0.0094399247  4.560014e-04
## 202 -0.002080531  0.0055937328  4.271075e-04
## 203 -0.001195833  0.0094399247  4.560014e-04
## 204 -0.029819286 -0.0122167983 -2.921271e-05
## 205 -0.559046000 -0.0244166353 -2.162588e-03
## 206 -0.003728290  0.0053512136  5.135992e-04
## 207 -0.001195833  0.0094399247  4.560014e-04
## 208 -0.001195833  0.0094399247  4.560014e-04
## 209 -0.313236151  0.0047825637 -9.314168e-04
## 210  0.545714100 -0.1897572368 -6.576587e-04
## 211  0.112710406 -0.0260900900  5.171462e-04
## 212 -0.001195833  0.0094399247  4.560014e-04
## 213 -0.063658994  0.0023036899  2.283267e-04
## 214 -0.001195833  0.0094399247  4.560014e-04
## 215 -0.653896298 -0.0081867663 -2.278858e-03
## 216 -0.656359686  0.0138133933 -2.939007e-03
## 217 -0.001195833  0.0094399247  4.560014e-04
## 218 -0.001195833  0.0094399247  4.560014e-04
## 219  0.131913914 -0.0560522566 -2.503327e-04
## 220  0.079937662 -0.0257882781  4.396048e-04
## 221 -0.002705611  0.0047411921  3.302181e-04
## 222  0.019091315  0.0181389127 -8.631964e-05
## 223  0.029044455  0.0050494016  5.911406e-04
## 224 -0.001195833  0.0094399247  4.560014e-04
## 225  0.010504884 -0.0025349572 -8.962484e-04
## 226 -0.015302360 -0.0001696211 -2.075239e-04
## 227 -0.050748880  0.0053089910  1.113521e-04
## 228  0.023736264 -0.0180277501  4.177775e-04
## 229 -0.001195833  0.0094399247  4.560014e-04
## 230  0.294300634 -0.1003760129  3.047519e-04
## 231  0.275694705 -0.0722483151  1.977782e-04
## 232  0.033031373  0.0356928932 -1.379033e-03
## 233  0.029929153  0.0088955936  6.200344e-04
## 234 -0.142321099 -0.1282844208  4.663303e-02
## 235  0.135037054 -0.0131668152  1.910171e-04
## 236 -0.001195833  0.0094399247  4.560014e-04
## 237  0.160873657  0.0446937648 -1.231761e-03
## 238  0.117133898 -0.0068591302  6.616154e-04
## 239  0.350400628 -0.0322150718 -1.490605e-04
## 240 -0.090625662 -0.0639105329 -7.579044e-03
## 241 -0.015302360 -0.0001696211 -2.075239e-04
## 242  0.596204753  0.3991150547 -5.757459e-03
## 243  0.168629155 -0.0028172385  6.423148e-04
## 244 -0.002080531  0.0055937328  4.271075e-04
## 245  0.135037054 -0.0131668152  1.910171e-04
## 246 -0.001195833  0.0094399247  4.560014e-04
## 247 -0.055240594 -0.0312470955 -1.840283e-03
## 248 -0.015302360 -0.0001696211 -2.075239e-04
## 249 -0.031742887  0.0082268956  2.530377e-04
## 250  0.117195730  0.0462773972 -5.129342e-04
## 251  0.038540017  0.0052166415  5.873907e-04
## 252 -0.001195833  0.0094399247  4.560014e-04
## 253 -0.633456153  0.0084527821 -1.762631e-03
## 254 -0.311131888  0.0223012704 -1.353580e-03
## 255 -0.431133659  0.0042121981 -1.356670e-03
## 256  0.029044455  0.0050494016  5.911406e-04
## 257 -0.133401293 -0.0106321997 -9.634751e-05
## 258 -0.058652863 -0.0057089497 -4.121579e-04
## 259 -0.001548495  0.0154812289 -2.704495e-04
## 260  0.021052486  0.1101491025 -2.967105e-03
## 261  0.057515345 -0.0070335054  6.684921e-04
## 262  0.019091315  0.0181389127 -8.631964e-05
## 263 -0.198305359 -0.0210821133 -5.110952e-04
## 264  0.049017412 -0.0201449050  6.582951e-04
## 265 -0.029819286 -0.0122167983 -2.921271e-05
## 266  0.173190981 -0.0348711363  7.874247e-04
## 267 -0.005181719  0.0008501594 -1.143843e-04
## 268  0.019465302  0.0351096756 -4.289586e-03
## 269  0.015933643 -0.0354113576  3.607136e-04
## 270 -0.081926877  0.0008463457  3.229746e-04
## 271 -0.001195833  0.0094399247  4.560014e-04
## 272  0.021924108  0.0017498842  4.847565e-04
## 273 -0.004612988  0.0015050216  4.847053e-04
## 274 -0.001195833  0.0094399247  4.560014e-04
## 275 -0.001195833  0.0094399247  4.560014e-04
## 276  0.136750102 -0.0056721098  7.510051e-04
## 277 -0.029819286 -0.0122167983 -2.921271e-05
## 278 -0.133171508  0.0068009805  1.169418e-04
## 279 -0.058390076  0.0033709452  3.362703e-04
## 280  0.106725882  0.0054145796  4.885046e-04
## 281  0.087404209 -0.0363070735  4.460627e-04
## 282  0.101826704 -0.0235061978  5.393922e-04
## 283 -0.001195833  0.0094399247  4.560014e-04
## 284 -0.029819286 -0.0122167983 -2.921271e-05
## 285 -0.029819286 -0.0122167983 -2.921271e-05
## 286 -0.002080531  0.0055937328  4.271075e-04
## 287 -0.354615124 -0.0161367435 -1.440338e-03
## 288 -0.013848931  0.0043314330  4.204596e-04
## 289 -0.029819286 -0.0122167983 -2.921271e-05
## 290 -0.001195833  0.0094399247  4.560014e-04
## 291  0.141629308 -0.0181742257  1.265780e-03
## 292  0.764928312 -0.1639163251  1.146800e-03
## 293  0.029929153  0.0088955936  6.200344e-04
## 294 -0.001195833  0.0094399247  4.560014e-04
## 295  0.112710406 -0.0260900900  5.171462e-04
## 296 -0.035516798 -0.0176070592 -1.913265e-04
## 297  0.062689626  0.0616502669 -7.539292e-04
## 298 -0.001195833  0.0094399247  4.560014e-04
## 299  0.271690155 -0.0494642775 -1.406978e-03
## 300  0.029929153  0.0088955936  6.200344e-04
## 301  0.118407556 -0.0443012693  4.658165e-04
## 302  0.247742627 -0.0557343518  7.934639e-04
## 303 -0.002624446 -0.0007536557  2.176112e-04
## 304 -0.002080531  0.0055937328  4.271075e-04
## 305 -0.029819286 -0.0122167983 -2.921271e-05
## 306  0.274987975 -0.1857004180 -7.515425e-05
## 307  0.117133898 -0.0068591302  6.616154e-04
## 308 -0.052398552  0.0031333542  2.390238e-04
## 309 -0.001195833  0.0094399247  4.560014e-04
## 310 -0.001195833  0.0094399247  4.560014e-04
## 311 -0.078660562 -0.0486358765 -4.480013e-03
## 312 -0.029819286 -0.0122167983 -2.921271e-05
## 313  0.002047969  0.0431648821 -1.521829e-03
## 314  0.033660664  0.0196186503 -1.517917e-03
## 315 -0.055240594 -0.0312470955 -1.840283e-03
## 316 -0.078660562 -0.0486358765 -4.480013e-03
## 317  0.010504884 -0.0025349572 -8.962484e-04
## 318 -0.001195833  0.0094399247  4.560014e-04
## 319 -0.001195833  0.0094399247  4.560014e-04
## 320 -0.001195833  0.0094399247  4.560014e-04
## 321 -0.001195833  0.0094399247  4.560014e-04
## 322 -0.001195833  0.0094399247  4.560014e-04
## 323 -0.127825781 -0.0362932437 -2.919565e-04
## 324  0.105632819 -0.0568596257  2.859954e-04
## 325 -0.008740193  0.0021807677  2.531392e-04
## 326 -0.001195833  0.0094399247  4.560014e-04
## 327 -0.055240594 -0.0312470955 -1.840283e-03
## 328  0.147633804 -0.0082560020  7.287591e-04
## 329 -0.100983930  0.0137681303 -3.095696e-04
## 330  0.012501139 -0.0403269029  8.245487e-05
## 331 -0.072934210 -0.0168797951  9.866157e-05
## 332 -0.001195833  0.0094399247  4.560014e-04
## 333  0.089918449 -0.0305876433  2.024613e-04
## 334  0.219509790 -0.0161854694  1.836288e-04
## 335 -0.050160469 -0.0107515229  2.273428e-04
## 336 -0.001195833  0.0094399247  4.560014e-04
## 337 -0.056059368 -0.0344727295  5.294991e-05
## 338 -0.001195833  0.0094399247  4.560014e-04
## 339 -0.246263659 -0.0299775043 -5.665806e-04
## 340 -0.002080531  0.0055937328  4.271075e-04
## 341 -0.001195833  0.0094399247  4.560014e-04
## 342 -0.005181719  0.0008501594 -1.143843e-04
## 343 -0.078660562 -0.0486358765 -4.480013e-03
## 344 -0.055240594 -0.0312470955 -1.840283e-03
## 345 -0.029819286 -0.0122167983 -2.921271e-05
## 346 -0.015302360 -0.0001696211 -2.075239e-04
## 347 -0.039155129 -0.0058855504  3.493762e-04
## 348  0.019564296  0.0211389578  1.520463e-05
## 349 -0.011725486  0.0142637699  1.386112e-04
## 350 -0.029819286 -0.0122167983 -2.921271e-05
## 351 -0.001195833  0.0094399247  4.560014e-04
## 352 -0.078660562 -0.0486358765 -4.480013e-03
## 353 -0.001195833  0.0094399247  4.560014e-04
## 354  0.029929153  0.0088955936  6.200344e-04
## 355 -0.001195833  0.0094399247  4.560014e-04
## 356 -0.519671552 -0.0345270974 -1.845765e-03
## 357 -0.240102478  0.0011100092 -6.255966e-04
## 358 -0.029819286 -0.0122167983 -2.921271e-05
## 359 -0.001195833  0.0094399247  4.560014e-04
## 360 -0.001195833  0.0094399247  4.560014e-04
## 361  0.019399499  0.0137194387  3.026443e-04
## 362 -0.069503564 -0.0114783428  1.452270e-04
## 363 -0.121632893 -0.0093699000 -8.969963e-05
## 364 -0.167589671 -0.0946294467 -4.463072e-04
## 365  0.032381884 -0.0067267653  4.072125e-04
## 366 -0.051017215 -0.0425990750 -7.279937e-04
## 367 -0.029744536  0.0037448793  1.822456e-04
## 368 -0.364223953 -0.0286066881 -1.949757e-03
## 369 -0.001195833  0.0094399247  4.560014e-04
## 370 -0.118907280  0.0463770634 -9.064601e-04
## 371 -0.059653381  0.0235262757 -3.839867e-04
## 372  0.099788484 -0.0106121041  4.747379e-04
## 373  0.029044455  0.0050494016  5.911406e-04
## 374 -0.111864994 -0.0195775197  4.994763e-05
## 375 -0.019623895  0.0047646599  2.753851e-04
## 376 -0.055857619  0.0074596564  2.786725e-04
## 377  0.029044455  0.0050494016  5.911406e-04
## 378  0.419877137 -0.0761575291  1.936606e-03
## 379 -0.482369162  0.0259649077 -1.579044e-03
## 380 -0.389124971  0.0010839747 -1.214882e-03
## 381 -0.443653998 -0.0092278958 -1.239974e-03
## 382  0.008040111  0.0066135133  5.202470e-04
## 383 -0.154405637 -0.0090680881 -1.672411e-04
## 384  0.005386016 -0.0049250626  4.335655e-04
## 385 -0.013848931  0.0043314330  4.204596e-04
## 386 -0.001195833  0.0094399247  4.560014e-04
## 387 -0.836080978 -0.0497779747 -3.364641e-03
## 388 -0.001195833  0.0094399247  4.560014e-04
## 389  0.038621181 -0.0002782063  4.747838e-04
## 390 -0.001195833  0.0094399247  4.560014e-04
## 391  0.027960046  0.0641375299 -1.038172e-03
## 392 -0.003728290  0.0053512136  5.135992e-04
## 393 -0.135402242  0.0090922425 -1.263424e-04
## 394  0.253708886 -0.0302488648  1.129668e-03
## 395  0.204572159 -0.0048417581  4.496595e-04
## 396  0.146489487 -0.0150958453  7.678608e-04
## 397  0.124600445 -0.0173779256  6.680734e-04
## 398  0.120731565 -0.0102972012  5.011417e-04
## 399  0.151856551 -0.0108415324  6.651748e-04
## 400 -0.029819286 -0.0122167983 -2.921271e-05
## 401 -0.029865539  0.0067747903 -1.392422e-04
## 402  0.114479803 -0.0183977061  5.749339e-04
## 403 -0.001195833  0.0094399247  4.560014e-04
## 404 -0.001195833  0.0094399247  4.560014e-04
## 405  0.089135016 -0.0860585027  2.855456e-04
## 406  0.107402216 -0.0491672418  3.437831e-04
## 407  0.037523287  0.0094631604  1.350403e-04
## 408 -0.011535779 -0.0099745889  1.780223e-04
## 409 -0.251852662 -0.0017830095 -4.462409e-04
## 410 -0.181269691 -0.0432226842 -9.704938e-04
## 411  0.143887062  0.0000818987  5.343054e-04
## 412  0.029929153  0.0088955936  6.200344e-04
## 413 -0.002965229  0.0017475408  3.982137e-04
## 414  1.062710848  0.1581259446 -3.536337e-03
## 415 -0.001195833  0.0094399247  4.560014e-04
## 416 -0.001195833  0.0094399247  4.560014e-04
## 417 -0.001195833  0.0094399247  4.560014e-04
## 418 -0.029819286 -0.0122167983 -2.921271e-05
## 419 -0.001195833  0.0094399247  4.560014e-04
## 420 -0.001195833  0.0094399247  4.560014e-04
## 421  0.120857648 -0.0256525264  3.293588e-04
## 422 -0.001195833  0.0094399247  4.560014e-04
## 423 -0.001195833  0.0094399247  4.560014e-04
## 424 -0.001195833  0.0094399247  4.560014e-04
## 425 -0.001195833  0.0094399247  4.560014e-04
## 426 -0.001195833  0.0094399247  4.560014e-04
## 427  0.005507654  0.0025248021  5.778448e-04
## 428  0.937567760  0.0774854323 -3.486155e-03
## 429 -0.233315868 -0.0899248499 -1.771772e-03
## 430  0.136490483 -0.0086657611  8.190006e-04
## 431  0.033031373  0.0356928932 -1.379033e-03
## 432 -0.002080531  0.0055937328  4.271075e-04
## 433 -0.052135737  0.0568594268 -1.182097e-03
## 434  0.033031373  0.0356928932 -1.379033e-03
## 435 -0.001195833  0.0094399247  4.560014e-04
## 436  0.175845076 -0.0233325604  8.741062e-04
## 437  0.007155412  0.0027673214  4.913532e-04
## 438  0.156737716 -0.0029897026  3.695482e-04
## 439  0.087710626 -0.0118595968 -8.035276e-04
## 440 -0.055240594 -0.0312470955 -1.840283e-03
## 441 -0.029819286 -0.0122167983 -2.921271e-05
## 442 -0.055240594 -0.0312470955 -1.840283e-03
## 443 -0.029819286 -0.0122167983 -2.921271e-05
## 444 -0.001195833  0.0094399247  4.560014e-04
## 445 -0.060159473 -0.0043214387  2.784826e-04
## 446 -0.001195833  0.0094399247  4.560014e-04
## 447 -0.020084580  0.0048781076  3.429694e-04
## 448 -0.001195833  0.0094399247  4.560014e-04
## 449 -0.154297490  0.0009152275 -9.823111e-05
## 450 -0.001195833  0.0094399247  4.560014e-04
## 451  0.029044455  0.0050494016  5.911406e-04
## 452  0.140183367  0.0054860130 -5.520465e-04
## 453 -0.005181719  0.0008501594 -1.143843e-04
## 454 -0.001195833  0.0094399247  4.560014e-04
## 455 -0.029819286 -0.0122167983 -2.921271e-05
## 456  0.000919764  0.0033139959  4.138630e-04
## 457 -0.002080531  0.0055937328  4.271075e-04
## 458  0.007155412  0.0027673214  4.913532e-04
## 459  0.001305700 -0.0127611295  1.348204e-04
## 460 -0.256717716 -0.0038905258 -4.112289e-04
## 461  0.052326420 -0.0221933174  5.605812e-04
## 462 -0.037507370 -0.0056430312  2.628845e-04
## 463  0.140434408 -0.0292667163  1.399888e-04
## 464 -0.001195833  0.0094399247  4.560014e-04
## 465  0.141269934 -0.0223698470  2.036381e-04
## 466  0.038280398  0.0022229902  6.553863e-04
## 467 -0.155411973 -0.0203641447 -3.404142e-04
## 468 -0.351093633 -0.1076935880 -1.492242e-03
## 469 -0.002965229  0.0017475408  3.982137e-04
## 470 -0.029819286 -0.0122167983 -2.921271e-05
## 471 -0.001195833  0.0094399247  4.560014e-04
## 472 -0.001195833  0.0094399247  4.560014e-04
## 473 -0.001195833  0.0094399247  4.560014e-04
## 474 -0.168353773 -0.0469452100 -1.266438e-03
## 475  0.007155412  0.0027673214  4.913532e-04
## 476 -0.248455017  0.0119717281 -9.348144e-04
## 477 -0.342547089 -0.0039166140 -1.832111e-03
## 478 -0.001195833  0.0094399247  4.560014e-04
## 479 -0.016503026 -0.0072071429  3.337781e-04
## 480  0.029044455  0.0050494016  5.911406e-04
## 481 -0.001195833  0.0094399247  4.560014e-04
## 482 -0.624693271 -0.0267065390 -2.200233e-03
## 483 -0.447568807  0.0039039444 -2.186579e-03
## 484 -0.264577748 -0.0083993700 -7.047192e-04
## 485 -0.002080531  0.0055937328  4.271075e-04
## 486  0.026390359 -0.0064891743  5.044591e-04
## 487 -0.521469486 -0.0164995540 -2.772671e-03
## 488  0.102119073 -0.0461947642 -1.052945e-05
## 489  0.008970674  0.0171191321 -1.794592e-04
## 490 -0.031213398 -0.0490291182  1.309698e-04
## 491 -0.033297213 -0.0573364902 -4.341054e-04
## 492  0.012462101 -0.0023072450  2.888775e-04
## 493 -0.001195833  0.0094399247  4.560014e-04
## 494  0.178272346 -0.0801849525  4.405922e-05
## 495 -0.001195833  0.0094399247  4.560014e-04
## 496 -0.145061546 -0.0019111840 -3.398544e-05
## 497 -0.001195833  0.0094399247  4.560014e-04
## 498 -0.184499566  0.0117628284 -9.401118e-04
## 499 -0.583989073  0.0137445116 -2.517801e-03
## 500 -0.545403343 -0.0247136616 -2.585005e-03
## 501  0.174105341 -0.0282557871  3.216935e-04
## 502 -0.141485217 -0.0526977921 -5.006715e-04
## 503 -0.505717599  0.0004641234 -1.723494e-03
## 504  0.233518709 -0.0746140480  2.534752e-04
## 505  0.117522858 -0.0481474613  4.369226e-04
## 506 -0.003849928 -0.0020986511  3.693198e-04
## 507  0.809009165  0.0427565744  6.046802e-04
## 508 -0.001195833  0.0094399247  4.560014e-04
## 509  0.367879389 -0.1056642692  2.658960e-04
## 510 -0.002965229  0.0017475408  3.982137e-04
## 511 -0.934482534  0.0554168361 -4.635016e-03
## 512 -0.033698023 -0.0207379340  2.708215e-04
## 513  0.006398301  0.0100074915 -2.899282e-05
## 514 -0.070176198 -0.0078600116 -1.103118e-04
## 515 -0.009266265 -0.0351591185  1.269468e-04
## 516  0.142609588 -0.0015778168  6.534241e-05
## 517  0.118627916 -0.0399224377  2.021771e-04
## 518  0.029044455  0.0050494016  5.911406e-04
## 519  0.149553980 -0.0011196380  1.270596e-05
## 520 -0.001195833  0.0094399247  4.560014e-04
## 521 -0.003198459  0.0358266653 -2.361991e-04
## 522 -0.001195833  0.0094399247  4.560014e-04
## 523 -0.001195833  0.0094399247  4.560014e-04
## 524 -0.001195833  0.0094399247  4.560014e-04
## 525  0.351574730 -0.1242588722  4.557376e-04
## 526 -0.001195833  0.0094399247  4.560014e-04
## 527 -0.001195833  0.0094399247  4.560014e-04
## 528  0.035556335  0.0099508695  2.775515e-04
## 529 -0.392499303 -0.0087474750 -2.463000e-03
## 530 -0.271227464  0.0016543404 -7.896297e-04
## 531 -0.190618680 -0.0404925419 -1.033658e-03
## 532  0.029044455  0.0050494016  5.911406e-04
## 533 -0.001195833  0.0094399247  4.560014e-04
## 534  0.006270714 -0.0010788706  4.624593e-04
## 535 -0.054705225  0.0372818773 -8.997823e-04
## 536 -0.276418690 -0.0320485351 -1.304862e-03
## 537 -0.034853275  0.0058955447  3.495661e-04
## 538  0.122843746 -0.0861972326 -3.205838e-04
## 539 -0.001195833  0.0094399247  4.560014e-04
## 540 -0.029819286 -0.0122167983 -2.921271e-05
## 541 -0.056746548 -0.0088886434 -1.148862e-04
## 542 -0.001195833  0.0094399247  4.560014e-04
## 543 -0.171663502 -0.0092421697 -7.098274e-04
## 544 -0.009200878  0.0022942154  3.207235e-04
## 545  0.028159756  0.0012032097  5.622467e-04
## 546 -0.019675095 -0.0509964462  4.308108e-04
## 547  0.021924108  0.0017498842  4.847565e-04
## 548  0.029044455  0.0050494016  5.911406e-04
## 549 -0.001195833  0.0094399247  4.560014e-04
## 550 -0.029819286 -0.0122167983 -2.921271e-05
## 551  0.028159756  0.0012032097  5.622467e-04
## 552 -0.001195833  0.0094399247  4.560014e-04
## 553 -0.002705611  0.0047411921  3.302181e-04
## 554  0.110056311 -0.0376286659  4.304647e-04
## 555  0.029044455  0.0050494016  5.911406e-04
## 556 -0.010129627  0.0083432267  4.042653e-04
## 557  0.011637778  0.0031754423  3.597733e-04
## 558  0.059284742  0.0006588785  7.262798e-04
## 559  0.025924918 -0.0022105607 -3.182711e-05
## 560  0.007155412  0.0027673214  4.913532e-04
## 561  0.140951511 -0.0556061773  3.812085e-04
## 562 -0.001195833  0.0094399247  4.560014e-04
## 563  0.027275058 -0.0026429823  5.333529e-04
## 564  0.142670962  0.0131001111 -7.303306e-05
## 565 -0.028149789 -0.0010195779  4.714096e-04
## 566 -0.026186062  0.0024142711 -1.852779e-04
## 567 -0.002080531  0.0055937328  4.271075e-04
## 568 -0.001195833  0.0094399247  4.560014e-04
## 569 -0.002965229  0.0017475408  3.982137e-04
## 570  0.116249200 -0.0107053222  6.327216e-04
## 571 -0.004734626 -0.0059448431  3.404260e-04
## 572  0.155012734  0.0024834311 -1.709676e-04
## 573 -0.048851963 -0.0242698548  2.626283e-04
## 574 -0.002965229  0.0017475408  3.982137e-04
## 575  0.088583282 -0.0144872933  4.290398e-04
## 576 -0.001195833  0.0094399247  4.560014e-04
## 577 -0.002080531  0.0055937328  4.271075e-04
## 578 -0.001195833  0.0094399247  4.560014e-04
## 579 -0.009200878  0.0022942154  3.207235e-04
## 580 -0.001195833  0.0094399247  4.560014e-04
## 581  0.086484599  0.0033750186  3.022255e-04
## 582 -0.010266313  0.0093881132  4.839102e-04
## 583  0.067635987 -0.0060137249  7.616317e-04
## 584  0.193728551 -0.0129248693  8.866068e-04
## 585 -0.001195833  0.0094399247  4.560014e-04
## 586 -0.001195833  0.0094399247  4.560014e-04
## 587 -0.001195833  0.0094399247  4.560014e-04
## 588  0.037523287  0.0094631604  1.350403e-04
## 589 -0.001195833  0.0094399247  4.560014e-04
## 590 -0.001195833  0.0094399247  4.560014e-04
## 591  0.151919558  0.1295650379 -2.593133e-02
## 592  0.092179124  0.0078069313  9.481006e-04
## 593 -0.001195833  0.0094399247  4.560014e-04
## 594  0.038540017  0.0052166415  5.873907e-04
## 595 -0.001195833  0.0094399247  4.560014e-04
## 596  0.028500540 -0.0012979868  3.816443e-04
## 597  0.033031373  0.0356928932 -1.379033e-03
## 598 -0.008381567 -0.0313129265  1.558406e-04
## 599 -0.017495872 -0.0210366504  2.358743e-04
## 600  0.047164918 -0.0254864662  3.620633e-04
## 601  0.027275058 -0.0026429823  5.333529e-04
## 602  0.036077212 -0.0157924069  1.611700e-04
## 603  0.011828375 -0.0197575933 -1.174555e-04
## 604 -0.029819286 -0.0122167983 -2.921271e-05
## 605 -0.045120604 -0.0149082388  2.815814e-04
## 606  0.111062648 -0.0263326093  6.036378e-04
## 607  0.007155412  0.0027673214  4.913532e-04
## 608  0.056612925 -0.0208483544  1.996641e-04
## 609  0.287617420 -0.0067538712  5.393624e-04
## 610  0.150976348 -0.0332393247  4.290439e-04
## 611 -0.156951585 -0.0106233484 -1.849126e-04
## 612 -0.001195833  0.0094399247  4.560014e-04
## 613 -0.001195833  0.0094399247  4.560014e-04
## 614 -0.330983881 -0.0734871475 -1.565292e-03
## 615 -0.006082853  0.0049277913 -4.824134e-05
## 616 -0.134286997  0.0004142514 -7.866861e-04
## 617  0.151093490 -0.0072378596  7.805603e-04
## 618  0.027275058 -0.0026429823  5.333529e-04
## 619 -0.001195833  0.0094399247  4.560014e-04
## 620 -0.394408550 -0.0403080948 -1.305019e-03
## 621 -0.061807232 -0.0045639579  3.649743e-04
## 622 -0.020329696 -0.0516130104  1.087239e-04
## 623 -0.002080531  0.0055937328  4.271075e-04
## 624  0.025275876 -0.0277685465  2.622759e-04
## 625 -0.089137515  0.0269593075 -6.403410e-04
## 626 -0.001195833  0.0094399247  4.560014e-04
## 627  0.004501317 -0.0087712545  4.046717e-04
## 628 -0.029819286 -0.0122167983 -2.921271e-05
## 629 -0.059396412 -0.0079251115  1.630971e-04
## 630 -0.047875514 -0.0501414436 -6.282235e-04
## 631 -0.057319885  0.0289355661 -5.337467e-04
## 632 -0.048215768 -0.0341100808  3.757244e-04
## 633 -0.018272423 -0.0148995268  2.759904e-04
## 634 -0.029819286 -0.0122167983 -2.921271e-05
## 635 -0.015302360 -0.0001696211 -2.075239e-04
## 636 -0.001195833  0.0094399247  4.560014e-04
## 637 -0.004734626 -0.0059448431  3.404260e-04
## 638 -0.001195833  0.0094399247  4.560014e-04
## 639 -0.001195833  0.0094399247  4.560014e-04
## 640 -0.001195833  0.0094399247  4.560014e-04
## 641 -0.001195833  0.0094399247  4.560014e-04
## 642 -0.003958075 -0.0120819667  3.003099e-04
## 643  0.109146065 -0.0059886508  6.832629e-04
## 644 -0.029819286 -0.0122167983 -2.921271e-05
## 645 -0.001195833  0.0094399247  4.560014e-04
## 646 -0.029819286 -0.0122167983 -2.921271e-05
## 647 -0.172262054 -0.0671004613 -5.522891e-04
## 648  0.060298428  0.0070517322  3.855609e-04
## 649  0.021924108  0.0017498842  4.847565e-04
## 650 -0.001195833  0.0094399247  4.560014e-04
## 651 -0.002080531  0.0055937328  4.271075e-04
## 652 -0.001195833  0.0094399247  4.560014e-04
## 653  0.029929153  0.0088955936  6.200344e-04
## 654 -0.002080531  0.0055937328  4.271075e-04
## 655 -0.001195833  0.0094399247  4.560014e-04
## 656 -0.001195833  0.0094399247  4.560014e-04
## 657 -0.001195833  0.0094399247  4.560014e-04
## 658 -0.409796695  0.0003863903 -1.213723e-03
## 659 -0.001195833  0.0094399247  4.560014e-04
## 660 -0.001195833  0.0094399247  4.560014e-04
## 661  0.029044455  0.0050494016  5.911406e-04
## 662  0.163665038  0.0038918576  1.340412e-03
## 663 -0.001195833  0.0094399247  4.560014e-04
## 664 -0.029819286 -0.0122167983 -2.921271e-05
## 665 -0.001195833  0.0094399247  4.560014e-04
## 666 -0.001195833  0.0094399247  4.560014e-04
## 667 -0.001195833  0.0094399247  4.560014e-04
## 668 -0.001195833  0.0094399247  4.560014e-04
## 669 -0.001195833  0.0094399247  4.560014e-04
## 670 -0.001195833  0.0094399247  4.560014e-04
## 671 -0.001195833  0.0094399247  4.560014e-04
## 672  0.021924108  0.0017498842  4.847565e-04
## 673 -0.001195833  0.0094399247  4.560014e-04
## 674  0.033031373  0.0356928932 -1.379033e-03
## 675 -0.001195833  0.0094399247  4.560014e-04
## 676 -0.001195833  0.0094399247  4.560014e-04
## 677 -0.001195833  0.0094399247  4.560014e-04
## 678 -0.015302360 -0.0001696211 -2.075239e-04
## 679  0.021924108  0.0017498842  4.847565e-04
## 680 -0.001195833  0.0094399247  4.560014e-04
## 681 -0.001195833  0.0094399247  4.560014e-04
## 682  0.006398301  0.0100074915 -2.899282e-05
## 683 -0.002080531  0.0055937328  4.271075e-04
## 684 -0.001195833  0.0094399247  4.560014e-04
## 685 -0.001195833  0.0094399247  4.560014e-04
## 686 -0.001195833  0.0094399247  4.560014e-04
## 687 -0.001195833  0.0094399247  4.560014e-04
## 688 -0.001195833  0.0094399247  4.560014e-04
## 689 -0.001195833  0.0094399247  4.560014e-04
## 690 -0.002080531  0.0055937328  4.271075e-04
## 691 -0.001195833  0.0094399247  4.560014e-04
## 692 -0.001195833  0.0094399247  4.560014e-04
## 693 -0.001195833  0.0094399247  4.560014e-04
## 694 -0.001195833  0.0094399247  4.560014e-04
## 695 -0.002080531  0.0055937328  4.271075e-04
## 696 -0.002080531  0.0055937328  4.271075e-04
## 697 -0.002080531  0.0055937328  4.271075e-04
## 698 -0.002080531  0.0055937328  4.271075e-04
## 699 -0.002080531  0.0055937328  4.271075e-04
## 700 -0.001195833  0.0094399247  4.560014e-04
## 701 -0.001195833  0.0094399247  4.560014e-04
## 702 -0.001195833  0.0094399247  4.560014e-04
## 703 -0.029819286 -0.0122167983 -2.921271e-05
## 704 -0.001195833  0.0094399247  4.560014e-04
## 705 -0.002080531  0.0055937328  4.271075e-04
## 706 -0.002080531  0.0055937328  4.271075e-04
## 707 -0.001195833  0.0094399247  4.560014e-04
## 708 -0.001195833  0.0094399247  4.560014e-04
## 709 -0.001195833  0.0094399247  4.560014e-04
## 710 -0.001195833  0.0094399247  4.560014e-04
## 711 -0.001195833  0.0094399247  4.560014e-04
## 712 -0.001195833  0.0094399247  4.560014e-04
## 713 -0.001195833  0.0094399247  4.560014e-04
## 714 -0.001195833  0.0094399247  4.560014e-04
## 715 -0.002705611  0.0047411921  3.302181e-04
## 716 -0.002080531  0.0055937328  4.271075e-04
## 717 -0.009200878  0.0022942154  3.207235e-04
## 718 -0.001195833  0.0094399247  4.560014e-04
## 719 -0.001195833  0.0094399247  4.560014e-04
## 720  0.078466084  0.0711383522 -7.854563e-03
## 721  0.033031373  0.0356928932 -1.379033e-03
## 722  0.008040111  0.0066135133  5.202470e-04
## 723 -0.001195833  0.0094399247  4.560014e-04
## 724 -0.002080531  0.0055937328  4.271075e-04
## 725 -0.002080531  0.0055937328  4.271075e-04
## 726 -0.001195833  0.0094399247  4.560014e-04
## 727 -0.001195833  0.0094399247  4.560014e-04
## 728 -0.002080531  0.0055937328  4.271075e-04
## 729 -0.001195833  0.0094399247  4.560014e-04
## 730 -0.001195833  0.0094399247  4.560014e-04
## 731 -0.001195833  0.0094399247  4.560014e-04
## 732  0.029044455  0.0050494016  5.911406e-04
## 733 -0.001195833  0.0094399247  4.560014e-04
## 734  0.197927694 -0.0246538224  6.040017e-04
## 735  0.056537044 -0.0428287678  4.828856e-04
## 736 -0.001195833  0.0094399247  4.560014e-04
## 737 -1.023547457  0.0060128763 -3.666051e-03
## 738 -0.174600063 -0.0862657399 -1.661681e-03
## 739 -0.002080531  0.0055937328  4.271075e-04
## 740 -0.001195833  0.0094399247  4.560014e-04
## 741 -0.001195833  0.0094399247  4.560014e-04
## 742 -0.002080531  0.0055937328  4.271075e-04
## 743 -0.002080531  0.0055937328  4.271075e-04
## 744 -0.001195833  0.0094399247  4.560014e-04
## 745 -0.001195833  0.0094399247  4.560014e-04
## 746 -0.001195833  0.0094399247  4.560014e-04
## 747 -0.009200878  0.0022942154  3.207235e-04
## 748 -0.009200878  0.0022942154  3.207235e-04
## 749 -0.436221539  0.2106644514 -8.907283e-03
## 750 -0.002080531  0.0055937328  4.271075e-04
## 751 -0.009200878  0.0022942154  3.207235e-04
## 752 -0.001195833  0.0094399247  4.560014e-04
## 753 -0.001195833  0.0094399247  4.560014e-04
## 754  0.104480799 -0.0119676219  6.260737e-04
## 755  0.029044455  0.0050494016  5.911406e-04
## 756 -0.001195833  0.0094399247  4.560014e-04
## 757 -0.001195833  0.0094399247  4.560014e-04
## 758 -0.001195833  0.0094399247  4.560014e-04
## 759 -0.001195833  0.0094399247  4.560014e-04
## 760  0.029044455  0.0050494016  5.911406e-04
## 761  0.029044455  0.0050494016  5.911406e-04
## 762 -0.002080531  0.0055937328  4.271075e-04
## 763 -0.001195833  0.0094399247  4.560014e-04
## 764 -0.001195833  0.0094399247  4.560014e-04
## 765  0.717374081  0.1558424370 -5.477979e-03
## 766 -0.029819286 -0.0122167983 -2.921271e-05
## 767 -0.002965229  0.0017475408  3.982137e-04
## 768 -0.001195833  0.0094399247  4.560014e-04
## 769 -0.009200878  0.0022942154  3.207235e-04
## 770 -0.001195833  0.0094399247  4.560014e-04
## 771 -0.002080531  0.0055937328  4.271075e-04
## 772 -0.001195833  0.0094399247  4.560014e-04
## 773 -0.001195833  0.0094399247  4.560014e-04
## 774 -0.001195833  0.0094399247  4.560014e-04
## 775 -0.001195833  0.0094399247  4.560014e-04
## 776  0.029044455  0.0050494016  5.911406e-04
## 777 -0.001195833  0.0094399247  4.560014e-04
## 778 -0.001195833  0.0094399247  4.560014e-04
## 779 -0.001195833  0.0094399247  4.560014e-04
## 780  0.016745051  0.0159533320 -1.258509e-03
## 781 -0.001195833  0.0094399247  4.560014e-04
## 782  0.060169440  0.0045050705  7.551737e-04
## 783  0.033031373  0.0356928932 -1.379033e-03
## 784 -0.001195833  0.0094399247  4.560014e-04
##                                                                                                     category
## 1                                                                                                Album Notes
## 2                          Album Of Best Original Score Written For A Motion Picture Or A Television Special
## 3                                                                                          Album Of The Year
## 4                                                                   Album Of The Year (Other Than Classical)
## 5                                                                              Album Of The Year - Classical
## 6                                                                             Album Of The Year -- Classical
## 7                                                                                Album Of The Year Classical
## 8                                                                               Album Of The Year, Classical
## 9                                                                                    Alternative Music Album
## 10                                                                                           Americana Album
## 11                                                                                               Banda Album
## 12                                                                                    Banda Or Norteño Album
## 13                                      Best Accompaniment Arrangement For Vocalist(S) Or Instrumentalist(S)
## 14                                                                            Best African Music Performance
## 15                                                                                          Best Album Cover
## 16                                                                   Best Album Cover (Other Than Classical)
## 17                                                                              Best Album Cover - Classical
## 18                                                                           Best Album Cover - Graphic Arts
## 19                                                                   Best Album Cover - Other Than Classical
## 20                                                                            Best Album Cover - Photography
## 21                                                                            Best Album Cover, Graphic Arts
## 22                                                                             Best Album Cover, Photography
## 23                                                                           Best Album Created For Children
## 24                                                                                   Best Album For Children
## 25                                                                                          Best Album Notes
## 26                                                                              Best Album Notes (Classical)
## 27                                                                              Best Album Notes - Classical
## 28                                                                               Best Album Notes, Classical
## 29           Best Album Of Original Instrumental Background Score Written For A Motion Picture Or Television
## 30                         Best Album Of Original Score Written For A Motion Picture Or A Television Special
## 31           Best Album Or Original Instrumental Background Score Written For A Motion Picture Or Television
## 32                                                                                        Best Album Package
## 33                                                                               Best Alternative Jazz Album
## 34                                                                              Best Alternative Music Album
## 35                                                                        Best Alternative Music Performance
## 36                                                                           Best American Roots Performance
## 37                                                                                  Best American Roots Song
## 38                                                                                      Best Americana Album
## 39                                                                                Best Americana Performance
## 40                                                                                          Best Arrangement
## 41                                               Best Arrangement Accompanying A Vocalist Or Instrumentalist
## 42                                                                 Best Arrangement Accompanying Vocalist(S)
## 43                                           Best Arrangement Accompanying Vocalist(S) Or Instrumentalist(S)
## 44                                                                      Best Arrangement Accompanying Vocals
## 45                                                                               Best Arrangement For Voices
## 46                                                        Best Arrangement For Voices (Duo, Group Or Chorus)
## 47                                                                       Best Arrangement On An Instrumental
## 48                                                             Best Arrangement On An Instrumental Recording
## 49                                                              Best Arrangement, Instrumental Or A Cappella
## 50                                                                  Best Arrangement, Instruments And Vocals
## 51                                                    Best Audio Book, Narration, And Storytelling Recording
## 52                                                                               Best Background Arrangement
## 53                                          Best Background Arrangement (Behind Vocalist Or Instrumentalist)
## 54                                                                                          Best Banda Album
## 55                                                                                      Best Bluegrass Album
## 56                                                                                  Best Bluegrass Recording
## 57                                                          Best Bluegrass Recording (Vocal Or Instrumental)
## 58                                                                                          Best Blues Album
## 59                                                             Best Boxed Or Special Limited Edition Package
## 60                                                                              Best Boxed Recording Package
## 61                                                                                  Best Broadway Show Album
## 62                                                                                      Best Cast Show Album
## 63                                                    Best Chamber Music Or Other Small Ensemble Performance
## 64                                                                            Best Chamber Music Performance
## 65                                                    Best Chamber Music Performance - Instrumental Or Vocal
## 66                                                                    Best Chamber Music Performance - Vocal
## 67                                                             Best Chamber Music/Small Ensemble Performance
## 68                                                                   Best Chamber Performance - Instrumental
## 69                                                                                     Best Children'S Album
## 70                                                                               Best Children'S Music Album
## 71                                                                                   Best Choral Performance
## 72                                                                Best Choral Performance (Other Than Opera)
## 73                                                               Best Choral Performance, (Other Than Opera)
## 74                                                                        Best Choral Performance, Classical
## 75                                                     Best Choral Performance, Classical (Other Than Opera)
## 76                                                                                      Best Classical Album
## 77                                          Best Classical Chamber Music Performance - Instrumental Or Vocal
## 78                                                                         Best Classical Choral Performance
## 79                                                      Best Classical Choral Performance (Other Than Opera)
## 80                                                                                 Best Classical Compendium
## 81                                                     Best Classical Composition By A Contemporary Composer
## 82                                                       Best Classical Composition By Contemporary Composer
## 83                                                                   Best Classical Contemporary Composition
## 84                                                                            Best Classical Crossover Album
## 85                                                                       Best Classical Engineered Recording
## 86                                                                          Best Classical Instrumental Solo
## 87                                                                           Best Classical Opera Production
## 88                                                                     Best Classical Orchestral Performance
## 89                                                                       Best Classical Orchestral Recording
## 90                                                                Best Classical Performance - Chamber Music
## 91                                  Best Classical Performance - Chamber Music (Including Chamber Orchestra)
## 92                                                  Best Classical Performance - Choral (Including Oratorio)
## 93                                                    Best Classical Performance - Choral (Other Than Opera)
## 94                                             Best Classical Performance - Concerto Or Instrumental Soloist
## 95  Best Classical Performance - Concerto Or Instrumental Soloist (Other Than Full Orchestral Accompaniment)
## 96        Best Classical Performance - Concerto Or Instrumental Soloist (With Full Orchestral Accompaniment)
## 97                                             Best Classical Performance - Instrumental Solo With Orchestra
## 98                                          Best Classical Performance - Instrumental Solo Without Orchestra
## 99                                        Best Classical Performance - Instrumental Soloist (With Orchestra)
## 100      Best Classical Performance - Instrumental Soloist Or Duo (Other Than With Orchestral Accompaniment)
## 101                             Best Classical Performance - Instrumental Soloist Or Duo (Without Orchestra)
## 102                Best Classical Performance - Instrumental Soloist Or Soloists (With Or Without Orchestra)
## 103                           Best Classical Performance - Instrumental Soloist Or Soloists (With Orchestra)
## 104                        Best Classical Performance - Instrumental Soloist Or Soloists (Without Orchestra)
## 105                                    Best Classical Performance - Instrumental Soloist(S) (With Orchestra)
## 106                                 Best Classical Performance - Instrumental Soloist(S) (Without Orchestra)
## 107                   Best Classical Performance - Instrumentalist (Other Than Concerto-Scale Accompaniment)
## 108                         Best Classical Performance - Instrumentalist (With Concerto Scale Accompaniment)
## 109                                                        Best Classical Performance - Opera Cast Or Choral
## 110                                                          Best Classical Performance - Operatic Or Choral
## 111                                                                   Best Classical Performance - Orchestra
## 112                                       Best Classical Performance - Vocal Or Instrumental - Chamber Music
## 113                                                               Best Classical Performance - Vocal Soloist
## 114                                   Best Classical Performance - Vocal Soloist (With Or Without Orchestra)
## 115                                              Best Classical Performance Instrumental Solo With Orchestra
## 116                                           Best Classical Performance Instrumental Solo Without Orchestra
## 117                             Best Classical Performance Instrumental Soloist Or Soloists (With Orchestra)
## 118                          Best Classical Performance Instrumental Soloist Or Soloists (Without Orchestra)
## 119                                        Best Classical Performance, Instrumental Soloist (With Orchestra)
## 120                                     Best Classical Performance, Instrumental Soloist (Without Orchestra)
## 121                            Best Classical Performance, Instrumental Soloist Or Soloists (With Orchestra)
## 122                         Best Classical Performance, Instrumental Soloist Or Soloists (Without Orchestra)
## 123                                     Best Classical Performance, Instrumental Soloist(S) (With Orchestra)
## 124                                  Best Classical Performance, Instrumental Soloist(S) (Without Orchestra)
## 125                                                                    Best Classical Performance, Orchestra
## 126                                      Best Classical Performance-Instrumental Soloist (Without Orchestra)
## 127                                      Best Classical Performance-Instrumental Soloist(S) (With Orchestra)
## 128                                                                          Best Classical Solo Vocal Album
## 129                                                                         Best Classical Vocal Performance
## 130                                                                                Best Classical Vocal Solo
## 131                                                                             Best Classical Vocal Soloist
## 132                                                                 Best Classical Vocal Soloist Performance
## 133                                     Best Classical Vocal Soloist Performance (With Or Without Orchestra)
## 134                                                                                        Best Comedy Album
## 135                                                                                  Best Comedy Performance
## 136                                                                        Best Comedy Performance - Musical
## 137                                                                    Best Comedy Performance - Spoken Word
## 138                                                                                    Best Comedy Recording
## 139                 Best Compilation Soundtrack Album For A Motion Picture, Television Or Other Visual Media
## 140                   Best Compilation Soundtrack Album For Motion Picture, Television Or Other Visual Media
## 141                                                             Best Compilation Soundtrack For Visual Media
## 142                                                              Best Composition By A Contemporary Composer
## 143                                                                                 Best Concept Music Video
## 144                                         Best Contemporary (R&R) Group Performance, Vocal Or Instrumental
## 145                                      Best Contemporary (R&R) Performance - Group (Vocal Or Instrumental)
## 146                                                                        Best Contemporary (R&R) Recording
## 147                                                                           Best Contemporary (R&R) Single
## 148                                          Best Contemporary (R&R) Solo Vocal Performance - Male Or Female
## 149                                                         Best Contemporary (R&R) Vocal Performance - Male
## 150                                                        Best Contemporary (R&R) Vocal Performance, Female
## 151                                                                                  Best Contemporary Album
## 152                                                                            Best Contemporary Blues Album
## 153                                                                        Best Contemporary Blues Recording
## 154                                                                  Best Contemporary Christian Music Album
## 155                                                       Best Contemporary Christian Music Performance/Song
## 156                                                                   Best Contemporary Christian Music Song
## 157                                                                  Best Contemporary Classical Composition
## 158                                                                            Best Contemporary Composition
## 159                                                          Best Contemporary Female Solo Vocal Performance
## 160                                                                             Best Contemporary Folk Album
## 161                                                                         Best Contemporary Folk Recording
## 162                                                                   Best Contemporary Folk/Americana Album
## 163                                              Best Contemporary Group Performance (Vocal Or Instrumental)
## 164                                                                     Best Contemporary Instrumental Album
## 165                                                               Best Contemporary Instrumental Performance
## 166                                                                             Best Contemporary Jazz Album
## 167                                                                       Best Contemporary Jazz Performance
## 168                                                        Best Contemporary Jazz Performance (Instrumental)
## 169                                                            Best Contemporary Male Solo Vocal Performance
## 170                                                                Best Contemporary Performance By A Chorus
## 171                                                                              Best Contemporary R&B Album
## 172                                                                       Best Contemporary R&B Gospel Album
## 173                                                                                 Best Contemporary Single
## 174                                                                                   Best Contemporary Song
## 175                                                                      Best Contemporary Soul Gospel Album
## 176                                            Best Contemporary Vocal Performance By A Duo, Group Or Chorus
## 177                                                           Best Contemporary Vocal Performance By A Group
## 178                                                              Best Contemporary Vocal Performance, Female
## 179                                                                Best Contemporary Vocal Performance, Male
## 180                                                                      Best Contemporary World Music Album
## 181                                                                Best Contemporary-Pop Performance, Chorus
## 182                                                          Best Contemporary-Pop Performance, Instrumental
## 183                                                    Best Contemporary-Pop Performance, Vocal Duo Or Group
## 184                                                          Best Contemporary-Pop Vocal Performance, Female
## 185                                                            Best Contemporary-Pop Vocal Performance, Male
## 186                                                                             Best Country & Western Album
## 187                                                                       Best Country & Western Performance
## 188                          Best Country & Western Performance Duet, Trio Or Group (Vocal Or Instrumental)_
## 189                                                                         Best Country & Western Recording
## 190                                                                            Best Country & Western Single
## 191                                                    Best Country & Western Solo Vocal Performance, Female
## 192                                                      Best Country & Western Solo Vocal Performance, Male
## 193                                                                              Best Country & Western Song
## 194                                                        Best Country & Western Vocal Performance - Female
## 195                                                          Best Country & Western Vocal Performance - Male
## 196                                                           Best Country & Western Vocal Performance, Male
## 197                                                                                       Best Country Album
## 198                                                                   Best Country Collaboration With Vocals
## 199                                                                       Best Country Duo/Group Performance
## 200                                                                    Best Country Instrumental Performance
## 201                                      Best Country Instrumental Performance (Orchestra, Group Of Soloist)
## 202                                      Best Country Instrumental Performance (Orchestra, Group Or Soloist)
## 203                                     Best Country Instrumental Performance, (Orchestra, Group Or Soloist)
## 204                                                       Best Country Performance By A Duo Group With Vocal
## 205                                                    Best Country Performance By A Duo Or Group With Vocal
## 206                                                   Best Country Performance By A Duo Or Group With Vocals
## 207                                                                    Best Country Performance Duo Or Group
## 208                                           Best Country Performance, Duo Or Group - Vocal Or Instrumental
## 209                                                                            Best Country Solo Performance
## 210                                                                                        Best Country Song
## 211                                                                         Best Country Vocal Collaboration
## 212                                                                  Best Country Vocal Performance - Female
## 213                                                         Best Country Vocal Performance By A Duo Or Group
## 214                                                                     Best Country Vocal Performance, Duet
## 215                                                                   Best Country Vocal Performance, Female
## 216                                                                     Best Country Vocal Performance, Male
## 217                                                                Best Country Vocal Solo Performance, Male
## 218                                                                                 Best Dance Pop Recording
## 219                                                                                     Best Dance Recording
## 220                                                                              Best Dance/Electronic Album
## 221                                                                        Best Dance/Electronic Music Album
## 222                                                                          Best Dance/Electronic Recording
## 223                                                                             Best Dance/Electronica Album
## 224                                                                                     Best Disco Recording
## 225                                            Best Documentary Or Spoken Word Recording (Other Than Comedy)
## 226                                     Best Documentary, Spoken Word Or Drama Recording (Other Than Comedy)
## 227                                                                              Best Electronic/Dance Album
## 228                                                                    Best Engineered Album - Non-Classical
## 229                                                                   Best Engineered Album, - Non-Classical
## 230                                                                         Best Engineered Album, Classical
## 231                                                                     Best Engineered Album, Non-Classical
## 232                                                                       Best Engineered Record (Classical)
## 233                                                                   Best Engineered Record - Non-Classical
## 234                                                                                Best Engineered Recording
## 235                                                                    Best Engineered Recording (Classical)
## 236                                                                Best Engineered Recording (Non-Classical)
## 237                                                                    Best Engineered Recording - Classical
## 238                                                                Best Engineered Recording - Non Classical
## 239                                                                Best Engineered Recording - Non-Classical
## 240                                                         Best Engineered Recording - Other Than Classical
## 241                                                     Best Engineered Recording - Special Or Novel Effects
## 242                                                                     Best Engineered Recording, Classical
## 243                                                      Best Engineering Contribution - Classical Recording
## 244                                                                  Best Engineering Contribution - Novelty
## 245                                                        Best Engineering Contribution - Novelty Recording
## 246                                          Best Engineering Contribution - Other Than Classical Or Novelty
## 247                              Best Engineering Contribution - Other Than Novelty And Other Than Classical
## 248                                                        Best Engineering Contribution - Popular Recording
## 249                                                                Best Ethnic Or Traditional Folk Recording
## 250                                                                     Best Ethnic Or Traditional Recording
## 251                                       Best Ethnic Or Traditional Recording (Including Traditional Blues)
## 252                                                                        Best Ethnic Traditional Recording
## 253                                                                    Best Female Country Vocal Performance
## 254                                                                        Best Female Pop Vocal Performance
## 255                                                                        Best Female R&B Vocal Performance
## 256                                                                         Best Female Rap Solo Performance
## 257                                                                       Best Female Rock Vocal Performance
## 258                                                                                          Best Folk Album
## 259                                                                                    Best Folk Performance
## 260                                                                                      Best Folk Recording
## 261                                                                                  Best Global Music Album
## 262                                                                            Best Global Music Performance
## 263                                                                                        Best Gospel Album
## 264                                                                   Best Gospel Album By A Choir Or Chorus
## 265                                                                     Best Gospel Album By Choir Or Chorus
## 266                                                                        Best Gospel Choir Or Chorus Album
## 267                                                                 Best Gospel Or Other Religious Recording
## 268                                                       Best Gospel Or Other Religious Recording (Musical)
## 269                                                                                  Best Gospel Performance
## 270                                                         Best Gospel Performance (Other Than Soul Gospel)
## 271                                                                           Best Gospel Performance - Male
## 272                                                                Best Gospel Performance By A Duo Or Group
## 273                                               Best Gospel Performance By A Duo Or Group, Choir Or Chorus
## 274                                                    Best Gospel Performance Contemporary Or Inspirational
## 275                                                                    Best Gospel Performance, Contemporary
## 276                                                   Best Gospel Performance, Contemporary Or Inspirational
## 277                                                  Best Gospel Performance, Contemporary Or Insprirational
## 278                                                                          Best Gospel Performance, Female
## 279                                                                            Best Gospel Performance, Male
## 280                                                                     Best Gospel Performance, Traditional
## 281                                                                             Best Gospel Performance/Song
## 282                                                                                         Best Gospel Song
## 283                                           Best Gospel Vocal Performance By A Duo, Group, Choir Or Chorus
## 284                                                                    Best Gospel Vocal Performance, Female
## 285                                                                      Best Gospel Vocal Performance, Male
## 286                                                     Best Gospel/Contemporary Christian Music Performance
## 287                                                                               Best Hard Rock Performance
## 288                                                                    Best Hard Rock Performance With Vocal
## 289                                                                         Best Hard Rock/Metal Performance
## 290                                                   Best Hard Rock/Metal Performance Vocal Or Instrumental
## 291                                                                                Best Hawaiian Music Album
## 292                                                                                    Best Historical Album
## 293                                                                           Best Historical Reissue Record
## 294                                                                          Best Historical Repackage Album
## 295                                                                               Best Immersive Audio Album
## 296                                                                                Best Improvised Jazz Solo
## 297                                                                           Best Inspirational Performance
## 298                                                           Best Inspirational Performance (Non-Classical)
## 299                                                                            Best Instrumental Arrangement
## 300                                                 Best Instrumental Arrangement Accompanying A Vocalist(S)
## 301                                                      Best Instrumental Arrangement Accompanying Vocal(S)
## 302                                                   Best Instrumental Arrangement Accompanying Vocalist(S)
## 303                                                        Best Instrumental Arrangement Accompanying Vocals
## 304                                                 Best Instrumental Arrangement With Accompanying Vocal(S)
## 305                                                   Best Instrumental Arrangement With Accompanying Vocals
## 306                                                                            Best Instrumental Composition
## 307                                                          Best Instrumental Composition (Other Than Jazz)
## 308                             Best Instrumental Composition Written For A Motion Picture Or For Television
## 309            Best Instrumental Composition Written For A Motion Picture, Television Or Other Visual Media.
## 310                                                               Best Instrumental Jazz Performance (Group)
## 311                                         Best Instrumental Jazz Performance - Group Or Soloist With Group
## 312                                                         Best Instrumental Jazz Performance - Large Group
## 313                             Best Instrumental Jazz Performance - Large Group Or Soloist With Large Group
## 314                             Best Instrumental Jazz Performance - Small Group Or Soloist With Small Group
## 315                                              Best Instrumental Jazz Performance - Soloist Or Small Group
## 316                              Best Instrumental Jazz Performance, Large Group Or Soloist With Large Group
## 317                              Best Instrumental Jazz Performance, Small Group Or Soloist With Small Group
## 318                                                                            Best Instrumental Performance
## 319                                                          Best Instrumental Performance (Other Than Jazz)
## 320                                                                 Best Instrumental Performance - Non-Jazz
## 321                                                                  Best Instrumental Performance, Non-Jazz
## 322                                                   Best Instrumental Soloist Performance (With Orchestra)
## 323                                                Best Instrumental Soloist Performance (Without Orchestra)
## 324                                                Best Instrumental Soloist(S) Performance (With Orchestra)
## 325                                                                                  Best Instrumental Theme
## 326                                                  Best Instrumental Theme Or Instrumental Version Of Song
## 327                                                 Best Jazz Composition Of More Than Five Minutes Duration
## 328                                                                             Best Jazz Fusion Performance
## 329                                                      Best Jazz Fusion Performance, Vocal Or Instrumental
## 330                                                                             Best Jazz Instrumental Album
## 331                                                        Best Jazz Instrumental Album, Individual Or Group
## 332                                         Best Jazz Instrumental Performance Soloist (On A Jazz Recording)
## 333                                                             Best Jazz Instrumental Performance, Big Band
## 334                                                                Best Jazz Instrumental Performance, Group
## 335                                                  Best Jazz Instrumental Performance, Individual Or Group
## 336                                                                 Best Jazz Instrumental Performance, Solo
## 337                                                              Best Jazz Instrumental Performance, Soloist
## 338                                        Best Jazz Instrumental Performance, Soloist (On A Jazz Recording)
## 339                                                                              Best Jazz Instrumental Solo
## 340                                                                                    Best Jazz Performance
## 341                                                                            Best Jazz Performance - Group
## 342                                                       Best Jazz Performance - Large Group (Instrumental)
## 343                                          Best Jazz Performance - Large Group Or Soloist With Large Group
## 344                                          Best Jazz Performance - Small Group Or Soloist With Small Group
## 345                                                                          Best Jazz Performance - Soloist
## 346                                            Best Jazz Performance - Soloist Or Small Group (Instrumental)
## 347                                                                      Best Jazz Performance By A Big Band
## 348                                                                         Best Jazz Performance By A Group
## 349                                                                       Best Jazz Performance By A Soloist
## 350                                                        Best Jazz Performance By A Soloist (Instrumental)
## 351                                                                        Best Jazz Performance Large Group
## 352                                                                Best Jazz Performance Solo Or Small Group
## 353                                                                             Best Jazz Performance, Group
## 354                                                                        Best Jazz Performance, Individual
## 355                                                                                          Best Jazz Vocal
## 356                                                                                    Best Jazz Vocal Album
## 357                                                                              Best Jazz Vocal Performance
## 358                                                                     Best Jazz Vocal Performance - Female
## 359                                                                       Best Jazz Vocal Performance - Male
## 360                                                                 Best Jazz Vocal Performance Duo Or Group
## 361                                                                Best Jazz Vocal Performance, Duo Or Group
## 362                                                                      Best Jazz Vocal Performance, Female
## 363                                                                        Best Jazz Vocal Performance, Male
## 364                                                                           Best Large Jazz Ensemble Album
## 365                                                                     Best Large Jazz Ensemble Performance
## 366                                                                                    Best Latin Jazz Album
## 367                                                                              Best Latin Jazz Performance
## 368                                                                                     Best Latin Pop Album
## 369                                                                            Best Latin Pop Or Urban Album
## 370                                                                               Best Latin Pop Performance
## 371                                                                                     Best Latin Recording
## 372                                                                     Best Latin Rock Or Alternative Album
## 373                                                              Best Latin Rock, Alternative Or Urban Album
## 374                                                              Best Latin Rock, Urban Or Alternative Album
## 375                                                                        Best Latin Rock/Alternative Album
## 376                                                                  Best Latin Rock/Alternative Performance
## 377                                                                                   Best Latin Urban Album
## 378                                                                               Best Long Form Music Video
## 379                                                                      Best Male Country Vocal Performance
## 380                                                                          Best Male Pop Vocal Performance
## 381                                                                          Best Male R&B Vocal Performance
## 382                                                                           Best Male Rap Solo Performance
## 383                                                                         Best Male Rock Vocal Performance
## 384                                                                             Best Melodic Rap Performance
## 385                                                                                      Best Merengue Album
## 386                                                                                Best Merengue Performance
## 387                                                                                   Best Metal Performance
## 388                                                                        Best Metal Performance With Vocal
## 389                                                                              Best Mexican-American Album
## 390                                                                  Best Mexican-American Music Performance
## 391                                                                        Best Mexican-American Performance
## 392                                                           Best Mexican-American/Tejano Music Performance
## 393                                                                      Best Mexican/Mexican-American Album
## 394                                                                                          Best Music Film
## 395                                                                                         Best Music Video
## 396                                                                             Best Music Video - Long Form
## 397                                                                            Best Music Video - Short Form
## 398                                                                              Best Music Video, Long Form
## 399                                                                             Best Music Video, Short Form
## 400                                                                               Best Music Video-Long Form
## 401                                                                          Best Musical Album For Children
## 402                                                                             Best Musical Cast Show Album
## 403                   Best Musical Composition First Recorded And Released In 1958 (Over 5 Minutes Duration)
## 404              Best Musical Composition First Recorded And Released In 1959 (More Than 5 Minutes Duration)
## 405                                                                                  Best Musical Show Album
## 406                                                                               Best Musical Theater Album
## 407                                                            Best Música Mexicana Album (Including Tejano)
## 408                                                                                 Best Música Urbana Album
## 409                                                                         Best Native American Music Album
## 410                                                                                       Best New Age Album
## 411                                                                                 Best New Age Performance
## 412                                                                                   Best New Age Recording
## 413                                                                    Best New Age, Ambient, Or Chant Album
## 414                                                                                          Best New Artist
## 415                                                                                  Best New Artist Of 1959
## 416                                                                                  Best New Artist Of 1960
## 417                                                                                  Best New Artist Of 1961
## 418                                                                                  Best New Artist Of 1962
## 419                                                                                  Best New Artist Of 1963
## 420                                                                                  Best New Artist Of 1964
## 421                                                                              Best New Artist Of The Year
## 422                                                                                Best New Classical Artist
## 423                                                                           Best New Classical Composition
## 424                                                                        Best New Country & Western Artist
## 425                                                                Best New Country & Western Artist Of 1964
## 426                                                                                    Best New Country Song
## 427                                                                                       Best Norteño Album
## 428                                                                                     Best Opera Recording
## 429                                                                              Best Orchestral Performance
## 430                                                                                Best Orchestral Recording
## 431                                                                Best Original Cast Album (Broadway Or Tv)
## 432                                                                            Best Original Cast Show Album
## 433                                                                           Best Original Jazz Composition
## 434                                             Best Original Score From A Motion Picture Or Television Show
## 435                                    Best Original Score Written For A Motion Picture Or A Television Show
## 436                                 Best Original Score Written For A Motion Picture Or A Television Special
## 437                                      Best Original Score Written For A Motion Picture Or Television Show
## 438                                        Best Performance - Documentary Or Spoken Word (Other Than Comedy)
## 439                                                                                  Best Performance - Folk
## 440                                     Best Performance - Instrumental Soloist Or Soloists (With Orchestra)
## 441                                  Best Performance - Instrumental Soloist Or Soloists (Without Orchestra)
## 442                                                                             Best Performance - Orchestra
## 443                                                                    Best Performance By A "Top 40" Artist
## 444                                                                   Best Performance By A Band For Dancing
## 445                                                                             Best Performance By A Chorus
## 446                                                         Best Performance By A Chorus (7 Or More Persons)
## 447                                                                         Best Performance By A Dance Band
## 448                                                                  Best Performance By A Pop Single Artist
## 449                                                                        Best Performance By A Vocal Group
## 450                                                               Best Performance By A Vocal Group (2 To 6)
## 451                                                              Best Performance By A Vocal Group Or Chorus
## 452                                                                         Best Performance By An Orchestra
## 453                                                           Best Performance By An Orchestra - For Dancing
## 454                                                Best Performance By An Orchestra - For Other Than Dancing
## 455                                                             Best Performance By An Orchestra For Dancing
## 456   Best Performance By An Orchestra Or Instrumentalist With Orchestra - Primarily Not Jazz Or For Dancing
## 457                                                                             Best Performance Music Video
## 458                                                                        Best Performance Of A Choral Work
## 459                                                             Best Performance, Documentary Or Spoken Word
## 460                                                                                         Best Polka Album
## 461                                                                                     Best Polka Recording
## 462                                                                                           Best Pop Album
## 463                                                                       Best Pop Collaboration With Vocals
## 464                                                                                 Best Pop Dance Recording
## 465                                                                           Best Pop Duo/Group Performance
## 466                                                                                    Best Pop Gospel Album
## 467                                                                              Best Pop Instrumental Album
## 468                                                                        Best Pop Instrumental Performance
## 469                                          Best Pop Instrumental Performance (Orchestra, Group Or Soloist)
## 470               Best Pop Instrumental Performance By An Arranger, Composer, Orchestra And/Or Choral Leader
## 471                                           Best Pop Instrumental Performance By An Instrumental Performer
## 472                                         Best Pop Instrumental Performance, (Orchestra, Group Or Soloist)
## 473                                                              Best Pop Perf. By A Duo Of Group With Vocal
## 474                                                        Best Pop Performance By A Duo Or Group With Vocal
## 475                                                       Best Pop Performance By A Duo Or Group With Vocals
## 476                                                                                Best Pop Solo Performance
## 477                                                                                     Best Pop Vocal Album
## 478                                                                             Best Pop Vocal Collaboration
## 479                                                     Best Pop Vocal Performance By A Duo, Group Or Chorus
## 480                                                                    Best Pop Vocal Performance By A Group
## 481                                                       Best Pop Vocal Performance By Duo, Group Or Chorus
## 482                                                                       Best Pop Vocal Performance, Female
## 483                                                                         Best Pop Vocal Performance, Male
## 484                                                                       Best Pop/Contemporary Gospel Album
## 485                                                                                Best Producer Of The Year
## 486                                                                               Best Progressive R&B Album
## 487                                                                                           Best R&B Album
## 488                                                                        Best R&B Instrumental Performance
## 489                                          Best R&B Instrumental Performance (Orchestra, Group Or Soloist)
## 490                                                                                     Best R&B Performance
## 491                                                        Best R&B Performance By A Duo Or Group With Vocal
## 492                                                       Best R&B Performance By A Duo Or Group With Vocals
## 493                                            Best R&B Performance By A Duo Or Group, Vocal Or Instrumental
## 494                                                                                            Best R&B Song
## 495                                                             Best R&B Vocal Performance By A Duo Or Group
## 496                                                     Best R&B Vocal Performance By A Duo, Group Or Chorus
## 497                                                                    Best R&B Vocal Performance By A Group
## 498                                                                       Best R&B Vocal Performance, Female
## 499                                                                         Best R&B Vocal Performance, Male
## 500                                                                                           Best Rap Album
## 501                                                                                     Best Rap Performance
## 502                                                                   Best Rap Performance By A Duo Or Group
## 503                                                                                Best Rap Solo Performance
## 504                                                                                            Best Rap Song
## 505                                                                              Best Rap/Sung Collaboration
## 506                                                                                Best Rap/Sung Performance
## 507                                                                              Best Recording For Children
## 508                                         Best Recording For Children - Single Or Album, Musical Or Spoken
## 509                                                                                   Best Recording Package
## 510                                                                           Best Recording Package - Boxed
## 511                                                                                        Best Reggae Album
## 512                                                                                    Best Reggae Recording
## 513                                                                              Best Regional Mexican Album
## 514                                                     Best Regional Mexican Music Album (Including Tejano)
## 515                                                                          Best Regional Roots Music Album
## 516                                                                                   Best Remixed Recording
## 517                                                                    Best Remixed Recording, Non-Classical
## 518                                             Best Rhythm & Blues Group Performance, Vocal Or Instrumental
## 519                                                                          Best Rhythm & Blues Performance
## 520                                 Best Rhythm & Blues Performance By A Duo Or Group, Vocal Or Instrumental
## 521                                                                            Best Rhythm & Blues Recording
## 522                                                       Best Rhythm & Blues Solo Vocal Performance, Female
## 523                                                         Best Rhythm & Blues Solo Vocal Performance, Male
## 524                                               Best Rhythm & Blues Solo Vocal Performance, Male Or Female
## 525                                                                                 Best Rhythm & Blues Song
## 526                                                            Best Rhythm & Blues Vocal Performance, Female
## 527                                                              Best Rhythm & Blues Vocal Performance, Male
## 528                                                                               Best Rock & Roll Recording
## 529                                                                                          Best Rock Album
## 530                                                                                   Best Rock Gospel Album
## 531                                                                       Best Rock Instrumental Performance
## 532                                         Best Rock Instrumental Performance (Orchestra, Group Or Soloist)
## 533                                        Best Rock Instrumental Performance, (Orchestra, Group Or Soloist)
## 534                                                                            Best Rock Or Rap Gospel Album
## 535                                                                                    Best Rock Performance
## 536                                                       Best Rock Performance By A Duo Or Group With Vocal
## 537                                                      Best Rock Performance By A Duo Or Group With Vocals
## 538                                                                                           Best Rock Song
## 539                                                                     Best Rock Vocal Performance - Female
## 540                                                            Best Rock Vocal Performance By A Duo Or Group
## 541                                                                      Best Rock Vocal Performance, Female
## 542                                                                Best Rock Vocal Performance, Female, Male
## 543                                                                        Best Rock Vocal Performance, Male
## 544                                                                        Best Rock Vocal Performance, Solo
## 545                                                                      Best Rock/Contemporary Gospel Album
## 546                                                                                  Best Roots Gospel Album
## 547                                                                                  Best Sacred Performance
## 548                                                                        Best Sacred Performance (Musical)
## 549                                                                  Best Sacred Performance (Non-Classical)
## 550                                                                          Best Sacred Recording (Musical)
## 551                                                                                         Best Salsa Album
## 552                                                                                   Best Salsa Performance
## 553                                                                                Best Salsa/Merengue Album
## 554                                                              Best Score From An Original Cast Show Album
## 555                                                             Best Score From The Original Cast Show Album
## 556                       Best Score Soundtrack Album For A Motion Picture, Television Or Other Visual Media
## 557                         Best Score Soundtrack Album For Motion Picture, Television Or Other Visual Media
## 558                                        Best Score Soundtrack For Video Games And Other Interactive Media
## 559                                                                   Best Score Soundtrack For Visual Media
## 560                                    Best Score Soundtrack For Visual Media (Includes Film And Television)
## 561                                                                              Best Short Form Music Video
## 562                                                                          Best Show Album (Original Cast)
## 563                                                                          Best Small Ensemble Performance
## 564                                              Best Small Ensemble Performance (With Or Without Conductor)
## 565                                                                         Best Solo Rock Vocal Performance
## 566                                                                      Best Solo Vocal Performance, Female
## 567                                                                        Best Solo Vocal Performance, Male
## 568                                                 Best Song Written For A Motion Picture Or For Television
## 569                                 Best Song Written For A Motion Picture, Television Or Other Visual Media
## 570                                Best Song Written For A Motion Picture, Television Or Other Visual Media.
## 571                                   Best Song Written For Motion Picture, Television Or Other Visual Media
## 572                                                                       Best Song Written For Visual Media
## 573                                    Best Song Written Specifically For A Motion Picture Or For Television
## 574                                        Best Song Written Specifically For A Motion Picture Or Television
## 575                                                                             Best Soul Gospel Performance
## 576                                                                      Best Soul Gospel Performance - Male
## 577                                                           Best Soul Gospel Performance By A Duo Or Group
## 578                                          Best Soul Gospel Performance By A Duo Or Group, Choir Or Chorus
## 579                                            Best Soul Gospel Performance By A Duo, Group, Choir Or Chorus
## 580                Best Soul Gospel Performance By A Duo, Group, Choir Or Chorus - Singles, Albums Or Tracks
## 581                                                               Best Soul Gospel Performance, Contemporary
## 582                                                                     Best Soul Gospel Performance, Female
## 583                                                                       Best Soul Gospel Performance, Male
## 584                                                                Best Soul Gospel Performance, Traditional
## 585                                      Best Soul Gospel Vocal Performance By A Duo, Group, Choir Or Chorus
## 586                                                         Best Soul Gospel Vocal Performance, Female, Male
## 587                            Best Sound Track Album - Background Score From A Motion Picture Or Television
## 588                   Best Sound Track Album Or Recording Of Original Cast From Motion Picture Or Television
## 589                           Best Sound Track Album Or Recording Of Score From Motion Picture Of Television
## 590                                          Best Sound Track Album, Dramatic Picture Score Or Original Cast
## 591                                     Best Sound Track Album, Original Cast - Motion Picture Or Television
## 592                                                                                    Best Soundtrack Album
## 593                    Best Soundtrack Album Or Recording Of Music Score From A Motion Picture Of Television
## 594                                                                               Best Southern Gospel Album
## 595                                                  Best Southern Gospel, Country Gospel Or Bluegrass Album
## 596                                           Best Southern Gospel, Country Gospel Or Bluegrass Gospel Album
## 597                                                         Best Southern, Country Or Bluegrass Gospel Album
## 598                                                        Best Southern, Country, Or Bluegrass Gospel Album
## 599                                                                                 Best Spoken Comedy Album
## 600                                                                                   Best Spoken Word Album
## 601                                    Best Spoken Word Album (Includes Poetry, Audio Books & Story Telling)
## 602                                     Best Spoken Word Album (Includes Poetry, Audio Books & Storytelling)
## 603                                                                      Best Spoken Word Album For Children
## 604                                                                      Best Spoken Word Or Drama Recording
## 605                                                                    Best Spoken Word Or Non-Musical Album
## 606                                                                Best Spoken Word Or Non-Musical Recording
## 607                                                                            Best Spoken Word Poetry Album
## 608                                                                               Best Spoken Word Recording
## 609                                                         Best Spoken Word, Documentary Or Drama Recording
## 610                                                                                Best Surround Sound Album
## 611                                                                                        Best Tejano Album
## 612                                                                            Best Tejano Music Performance
## 613                                                                                  Best Tejano Performance
## 614                                                                             Best Traditional Blues Album
## 615                                                                         Best Traditional Blues Recording
## 616                                                                              Best Traditional Folk Album
## 617                                                                          Best Traditional Folk Recording
## 618                                                                            Best Traditional Gospel Album
## 619                                                                         Best Traditional Pop Performance
## 620                                                                         Best Traditional Pop Vocal Album
## 621                                                                   Best Traditional Pop Vocal Performance
## 622                                                                         Best Traditional R&B Performance
## 623                                                                         Best Traditional R&B Vocal Album
## 624                                                                   Best Traditional R&B Vocal Performance
## 625                                                                       Best Traditional Soul Gospel Album
## 626                                                                 Best Traditional Soul Gospel Performance
## 627                                                                    Best Traditional Tropical Latin Album
## 628                                                              Best Traditional Tropical Latin Performance
## 629                                                                       Best Traditional World Music Album
## 630                                                                                Best Tropical Latin Album
## 631                                                                          Best Tropical Latin Performance
## 632                                                                            Best Urban Contemporary Album
## 633                                                                       Best Urban/Alternative Performance
## 634                                                                                               Best Video
## 635                                                                                         Best Video Album
## 636                                                                                   Best Video, Short Form
## 637                                                            Best Vocal Arrangement For Two Or More Voices
## 638                                                                     Best Vocal Performance Album, Female
## 639                                                                       Best Vocal Performance Album, Male
## 640                                                    Best Vocal Performance Single Record Or Track, Female
## 641                                                      Best Vocal Performance Single Record Or Track, Male
## 642                                                                           Best Vocal Performance, Female
## 643                                                                             Best Vocal Performance, Male
## 644                                                                           Best Vocal Soloist Performance
## 645                                               Best Vocal Soloist Performance (With Or Without Orchestra)
## 646                                                                Best Vocal Soloist Performance, Classical
## 647                                                                                   Best World Music Album
## 648                                                                         Best Zydeco Or Cajun Music Album
## 649                                                                                          Bluegrass Album
## 650                                                                                              Blues Album
## 651                                                                 Boxed Or Special Limited Edition Package
## 652                                                                                Chamber Music Performance
## 653                                                                                         Children'S Album
## 654                                                                                       Choral Performance
## 655                                                                                          Classical Album
## 656                                                                       Classical Contemporary Composition
## 657                                                                                      Classical Crossover
## 658                                                                           Classical Producer Of The Year
## 659                                                                              Classical Vocal Performance
## 660                                                                                     Classical Vocal Solo
## 661                                                                                             Comedy Album
## 662                                                                             Compilation Soundtrack Album
## 663                                                                                 Contemporary Blues Album
## 664                                                                       Contemporary Christian Music Album
## 665                                                                        Contemporary Christian Music Song
## 666                                                                       Contemporary Classical Composition
## 667                                                                                  Contemporary Folk Album
## 668                                                                                  Contemporary Jazz Album
## 669                                                                                   Contemporary R&B Album
## 670                                                                            Contemporary R&B Gospel Album
## 671                                                                           Contemporary World Music Album
## 672                                                                                            Country Album
## 673                                                                         Country Collaboration With Vocal
## 674                                                                            Country Duo/Group Performance
## 675                                                                         Country Instrumental Performance
## 676                                                        Country Performance By A Duo Or Group With Vocals
## 677                                                                                 Country Solo Performance
## 678                                                                                             Country Song
## 679                                                                                          Dance Recording
## 680                                                                                  Dance/Electronica Album
## 681                                                                                   Electronic/Dance Album
## 682                                                                              Engineered Album, Classical
## 683                                                                          Engineered Album, Non-Classical
## 684                                                                         Female Country Vocal Performance
## 685                                                                             Female Pop Vocal Performance
## 686                                                                             Female R&B Vocal Performance
## 687                                                                                               Folk Album
## 688                                                                                             Gospel Album
## 689                                                                                       Gospel Performance
## 690                                                                                              Gospel Song
## 691                                                          Gospel/Contemporary Christian Music Performance
## 692                                                                                    Hard Rock Performance
## 693                                                                              Hard Rock/Metal Performance
## 694                                                                                     Hawaiian Music Album
## 695                                                                                         Historical Album
## 696                                                                                     Improvised Jazz Solo
## 697                                                                                 Instrumental Arrangement
## 698                                                                Instrumental Arrangement With Vocalist(S)
## 699                                                                                 Instrumental Composition
## 700                                                                                        Instrumental Solo
## 701                                                       Instrumental Soloist Performance (Without Orchestr
## 702                                                       Instrumental Soloist(S) Performance (With Orchestr
## 703                                                                                  Jazz Instrumental Album
## 704                                                             Jazz Instrumental Album, Individual Or Group
## 705                                                                                         Jazz Vocal Album
## 706                                                                                Large Jazz Ensemble Album
## 707                                                                                         Latin Jazz Album
## 708                                                                                          Latin Pop Album
## 709                                                                          Latin Pop, Rock, Or Urban Album
## 710                                                                   Latin Rock, Alternative Or Urban Album
## 711                                                                           Male Country Vocal Performance
## 712                                                                               Male Pop Vocal Performance
## 713                                                                               Male R&B Vocal Performance
## 714                                                                                        Metal Performance
## 715                                                            Most Promising New Classical Recording Artist
## 716                                                                                    Music Video/Long Form
## 717                                                                                   Music Video/Short Form
## 718                                                                               Musical Album For Children
## 719                                                                                       Musical Show Album
## 720                                                                                    Musical Theater Album
## 721                                                                              Native American Music Album
## 722                                                                                            New Age Album
## 723                                                                                            Norteño Album
## 724                                                                                          Opera Recording
## 725                                                                                   Orchestral Performance
## 726                                                                            Pop Collaboration With Vocals
## 727                                                                                Pop Duo/Group Performance
## 728                                                                                   Pop Instrumental Album
## 729                                                                             Pop Instrumental Performance
## 730                                                            Pop Performance By A Duo Or Group With Vocals
## 731                                                                                     Pop Solo Performance
## 732                                                                                          Pop Vocal Album
## 733                                                                            Pop/Contemporary Gospel Album
## 734                                                                                     Producer Of The Year
## 735                                                                     Producer Of The Year (Non-Classical)
## 736                                                                    Producer Of The Year, (Non-Classical)
## 737                                                                          Producer Of The Year, Classical
## 738                                                                      Producer Of The Year, Non-Classical
## 739                                                                                                R&B Album
## 740                                                                                          R&B Performance
## 741                                                            R&B Performance By A Duo Or Group With Vocals
## 742                                                                                                 R&B Song
## 743                                                                                                Rap Album
## 744                                                                                Rap Duo/Group Performance
## 745                                                                                          Rap Performance
## 746                                                                                     Rap Solo Performance
## 747                                                                                                 Rap Song
## 748                                                                                   Rap/Sung Collaboration
## 749                                                                                       Record Of The Year
## 750                                                                                        Recording Package
## 751                                                                                             Reggae Album
## 752                                                                         Regional Mexican Or Tejano Album
## 753                                                                               Regional Roots Music Album
## 754                                                                       Remixer Of The Year, Non-Classical
## 755                                                                                               Rock Album
## 756                                                                            Rock Instrumental Performance
## 757                                                                                 Rock Or Rap Gospel Album
## 758                                                                                         Rock Performance
## 759                                                           Rock Performance By A Duo Or Group With Vocals
## 760                                                                                                Rock Song
## 761                                                                                   Score Soundtrack Album
## 762                                                                               Small Ensemble Performance
## 763                                                                              Solo Rock Vocal Performance
## 764                                                                                           Song Mp/Tv/Ovm
## 765                                                                                         Song Of The Year
## 766                                                                            Song Written For Visual Media
## 767                                                                    Songwriter Of The Year, Non-Classical
## 768                                                             Southern, Country, Or Bluegrass Gospel Album
## 769                                                                                        Spoken Word Album
## 770                                                                           Spoken Word Album For Children
## 771                                                                                     Surround Sound Album
## 772                                                                                             Tejano Album
## 773                                                                                  Traditional Blues Album
## 774                                                                                   Traditional Folk Album
## 775                                                                                 Traditional Gospel Album
## 776                                                                              Traditional Pop Vocal Album
## 777                                                                              Traditional R&B Performance
## 778                                                                        Traditional R&B Vocal Performance
## 779                                                                            Traditional World Music Album
## 780                                                                                     Tropical Latin Album
## 781                                                                            Urban/Alternative Performance
## 782                                                                                        Video Of The Year
## 783                                                                                        World Music Album
## 784                                                                              Zydeco Or Cajun Music Album
fviz_nbclust(pca_results$x[, 1:4], kmeans, method = "wss") 

set.seed(4051)
k <- 5 
kmeans_result <- kmeans(pca_results$x[, 1:4], centers = k, nstart = 25)

pca_scores <- as.data.frame(pca_results$x)
pca_scores$category <- category_names
pca_scores$cluster <- factor(kmeans_result$cluster)

fviz_pca_ind(pca_results,
             geom.ind = "point",
             pointshape = 21,
             pointsize = 3,
             fill.ind = pca_scores$cluster,
             palette = "jco",
             repel = TRUE,
             legend.title = "Cluster") +
  ggtitle("K-means Clusters on PCA Scores")

pca_scores %>% arrange(cluster)
##             PC1           PC2           PC3           PC4           PC5
## 1   -1.10441568 -5.521760e-01  2.192519e-01  0.0535549841 -5.936641e-02
## 2   -0.63646246  1.058981e-02  4.893569e-02  0.1007589824 -2.770142e-01
## 3   -0.83861638  1.808546e-01 -1.130587e-02  0.1116063154 -1.788456e-01
## 4   -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 5   -1.10441568 -5.521760e-01  2.192519e-01  0.0535549841 -5.936641e-02
## 6   -1.10441568 -5.521760e-01  2.192519e-01  0.0535549841 -5.936641e-02
## 7   -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 8   -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 9   -1.03244088 -5.487743e-01 -8.157084e-02  0.0517514739 -6.468404e-02
## 10  -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 11  -1.10441568 -5.521760e-01  2.192519e-01  0.0535549841 -5.936641e-02
## 12  -1.03244088 -5.487743e-01 -8.157084e-02  0.0517514739 -6.468404e-02
## 13  -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 14  -1.03244088 -5.487743e-01 -8.157084e-02  0.0517514739 -6.468404e-02
## 15  -0.91059118  1.774528e-01  2.895169e-01  0.1134098255 -1.735280e-01
## 16  -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 17  -0.43665745 -5.229848e-01  7.209520e-02  0.0282250817  6.871165e-01
## 18  -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 19  -1.10441568 -5.521760e-01  2.192519e-01  0.0535549841 -5.936641e-02
## 20  -0.90790580 -5.464402e-01  2.797033e-01  0.0531811800 -1.582959e-01
## 21  -0.60322904 -1.115452e+00 -2.931301e-01 -0.0314739550 -2.267619e-01
## 22  -0.71894601  5.352847e-01  3.227067e-01  0.1030981791  7.744870e-01
## 23  -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 24  -0.65057191 -5.380398e-01  3.197825e-02  0.0511709133 -2.535156e-01
## 25  -0.11561248 -5.149148e-01  4.938206e-01  0.0292809836  4.945753e-01
## 26  -1.24450738 -3.119257e+00  1.476560e-01 -0.5191720619  5.467349e-02
## 27  -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 28  -0.05597226 -5.218538e-01 -1.316120e-01  0.0492482762 -5.014574e-01
## 29   0.16720317 -1.701173e+00 -9.755105e-02 -0.1728853687  4.520538e-01
## 30  -0.51131763  1.975064e-01  3.827316e-01  0.0902572374  6.772020e-01
## 31  -0.77510700 -5.403739e-01 -3.292959e-01  0.0497412073 -1.599038e-01
## 32  -0.85153088  8.578804e-01 -8.808518e-03  0.1259111471 -1.857173e-01
## 33  -1.04359168 -5.495115e-01 -8.892443e-02  0.0519185215 -5.565668e-02
## 34  -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 35  -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 36  -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 37  -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 38  -1.03244088 -5.487743e-01 -8.157084e-02  0.0517514739 -6.468404e-02
## 39  -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 40  -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 41  -0.14080116 -5.133944e-01 -4.985133e-01  0.0249124475  6.136613e-01
## 42  -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 43  -0.70514213 -5.321224e-01  3.124666e-01  0.0304023959  7.913636e-01
## 44  -0.70514213 -5.321224e-01  3.124666e-01  0.0304023959  7.913636e-01
## 45  -1.24450738 -3.119257e+00  1.476560e-01 -0.5191720619  5.467349e-02
## 46  -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 47  -0.83593100 -5.430384e-01 -2.111950e-02  0.0513776699 -1.636135e-01
## 48  -1.04359168 -5.495115e-01 -8.892443e-02  0.0519185215 -5.565668e-02
## 49  -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 50  -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 51  -0.63316733 -5.287207e-01  1.164386e-02  0.0285988858  7.860460e-01
## 52  -0.61683112 -1.722869e+00  1.506288e-03 -0.1707303754  8.010902e-01
## 53  -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 54  -1.10441568 -5.521760e-01  2.192519e-01  0.0535549841 -5.936641e-02
## 55  -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 56  -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 57  -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 58  -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 59  -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 60  -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 61  -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 62  -0.21277596 -5.167961e-01 -1.976906e-01  0.0267159576  6.189789e-01
## 63  -1.08807948 -1.746324e+00  2.091144e-01 -0.1457742772 -4.432218e-02
## 64  -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 65  -0.08306208 -9.746884e-01  1.614742e-01 -0.0341482080  5.300844e-01
## 66  -0.83593100 -5.430384e-01 -2.111950e-02  0.0513776699 -1.636135e-01
## 67  -0.63316733 -5.287207e-01  1.164386e-02  0.0285988858  7.860460e-01
## 68  -1.10441568 -5.521760e-01  2.192519e-01  0.0535549841 -5.936641e-02
## 69  -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 70  -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 71  -0.65057191 -5.380398e-01  3.197825e-02  0.0511709133 -2.535156e-01
## 72  -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 73  -0.70514213 -5.321224e-01  3.124666e-01  0.0304023959  7.913636e-01
## 74  -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 75  -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 76  -0.64697121  5.386865e-01  2.188393e-02  0.1012946689  7.691693e-01
## 77  -0.63316733 -5.287207e-01  1.164386e-02  0.0285988858  7.860460e-01
## 78  -0.02251986 -5.196421e-01 -1.095513e-01  0.0487471335 -5.285395e-01
## 79  -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 80  -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 81  -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 82  -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 83  -1.06854636  5.171584e-01 -8.603795e-02  0.1247813522 -6.350595e-02
## 84  -0.47010985 -5.251965e-01  5.003443e-02  0.0287262243  7.141986e-01
## 85  -0.44505842  7.378198e-01  1.135552e-01  0.1254096797 -3.862716e-01
## 86  -1.04624476  5.186329e-01 -7.133078e-02  0.1244472571 -8.156068e-02
## 87  -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 88  -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 89  -0.56744631 -5.339008e-01 -2.614909e-01  0.0492003557 -2.678606e-01
## 90  -0.78625780 -5.411111e-01 -3.366494e-01  0.0499082548 -1.508764e-01
## 91  -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 92  -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 93  -1.10441568 -5.521760e-01  2.192519e-01  0.0535549841 -5.936641e-02
## 94  -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 95  -0.79740860 -5.418483e-01 -3.440030e-01  0.0500753024 -1.418490e-01
## 96  -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 97  -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 98  -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 99  -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 100 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 101 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 102 -0.91059118  1.774528e-01  2.895169e-01  0.1134098255 -1.735280e-01
## 103 -1.03244088 -5.487743e-01 -8.157084e-02  0.0517514739 -6.468404e-02
## 104 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 105 -0.28234169 -1.598996e-01  1.402167e-01  0.0871970313 -4.380462e-01
## 106  0.14661843 -5.143591e-01  2.811372e-01  0.0495086494 -6.582607e-01
## 107 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 108 -1.24450738 -3.119257e+00  1.476560e-01 -0.5191720619  5.467349e-02
## 109 -1.22895077 -5.545101e-01 -1.420222e-01  0.0521252780  3.424541e-02
## 110 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 111 -0.70514213 -5.321224e-01  3.124666e-01  0.0304023959  7.913636e-01
## 112 -0.31945852  8.840003e-01 -5.245929e-01  0.0993185862  6.634048e-01
## 113 -1.10441568 -5.521760e-01  2.192519e-01  0.0535549841 -5.936641e-02
## 114 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 115 -0.66991486  8.378093e-03  2.687492e-02  0.1012601250 -2.499321e-01
## 116 -0.77779238  1.835191e-01 -3.194822e-01  0.1099698529 -1.751359e-01
## 117 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 118 -1.03244088 -5.487743e-01 -8.157084e-02  0.0517514739 -6.468404e-02
## 119 -0.37093643 -5.281649e-01 -2.010396e-01  0.0488265516 -3.667900e-01
## 120 -0.18281054 -9.052662e-01 -1.499734e-01 -0.0017650133 -4.521674e-01
## 121 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 122 -1.04624476  5.186329e-01 -7.133078e-02  0.1244472571 -8.156068e-02
## 123 -0.60089871 -5.361125e-01 -2.835517e-01  0.0497014983 -2.407785e-01
## 124 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 125 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 126 -0.38966963  2.028355e-01 -2.336211e-01  0.0869843122  6.846215e-01
## 127 -0.16428654 -5.244724e-01 -8.304768e-01  0.0468502977 -3.680264e-01
## 128 -0.37701723 -5.299238e-01 -5.533375e-01  0.0481923742 -3.089161e-01
## 129 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 130 -1.10441568 -5.521760e-01  2.192519e-01  0.0535549841 -5.936641e-02
## 131 -0.85823260 -5.445129e-01 -3.582668e-02  0.0517117649 -1.455588e-01
## 132 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 133 -1.22895077 -5.545101e-01 -1.420222e-01  0.0521252780  3.424541e-02
## 134 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 135 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 136 -1.22895077 -5.545101e-01 -1.420222e-01  0.0521252780  3.424541e-02
## 137 -0.90410121 -1.326348e+00  2.699349e-01 -0.0630149403 -1.438736e-01
## 138 -1.10441568 -5.521760e-01  2.192519e-01  0.0535549841 -5.936641e-02
## 139 -0.70514213 -5.321224e-01  3.124666e-01  0.0304023959  7.913636e-01
## 140 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 141 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 142 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 143 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 144 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 145 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 146 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 147 -0.26004009 -1.584251e-01  1.549238e-01  0.0868629362 -4.561010e-01
## 148 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 149 -0.43934283  2.009082e-01  8.190883e-02  0.0884537273  6.718844e-01
## 150 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 151 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 152 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 153 -1.10441568 -5.521760e-01  2.192519e-01  0.0535549841 -5.936641e-02
## 154 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 155  0.02715334 -5.177148e-01 -4.250812e-01  0.0472777185 -5.158024e-01
## 156 -0.20145131  1.997338e-01 -1.511994e-01  0.1090282879 -4.573006e-01
## 157 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 158 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 159 -1.22895077 -5.545101e-01 -1.420222e-01  0.0521252780  3.424541e-02
## 160 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 161 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 162 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 163 -0.12947651  2.031355e-01 -4.520221e-01  0.1072247778 -4.626182e-01
## 164 -0.27119089 -1.591624e-01  1.475703e-01  0.0870299838 -4.470736e-01
## 165 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 166 -1.03244088 -5.487743e-01 -8.157084e-02  0.0517514739 -6.468404e-02
## 167  0.06833197 -8.048283e-01  2.277282e-01  0.0143135164 -5.907978e-01
## 168 -0.21036689 -1.564979e-01 -1.606061e-01  0.0853935212 -4.433639e-01
## 169 -0.88053420 -5.459873e-01 -5.053386e-02  0.0520458600 -1.275040e-01
## 170 -1.03244088 -5.487743e-01 -8.157084e-02  0.0517514739 -6.468404e-02
## 171 -1.04359168 -5.495115e-01 -8.892443e-02  0.0519185215 -5.565668e-02
## 172 -0.45406203 -5.323039e-01  9.242959e-02  0.0507971092 -3.524450e-01
## 173 -0.85823260 -5.445129e-01 -3.582668e-02  0.0517117649 -1.455588e-01
## 174 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 175 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 176 -0.77130241 -1.320282e+00 -3.390642e-01 -0.0664549130 -1.454815e-01
## 177 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 178 -0.79740860 -5.418483e-01 -3.440030e-01  0.0500753024 -1.418490e-01
## 179 -0.24014756 -5.172489e-01  1.325465e-01  0.0278512776  5.881871e-01
## 180 -0.05478848 -5.122503e-01  1.856443e-01  0.0276445210  4.982850e-01
## 181 -0.10923871 -7.405918e-02  5.032998e-01  0.0713169194  4.805398e-01
## 182 -0.03726391 -7.065741e-02  2.024770e-01  0.0695134093  4.752222e-01
## 183 -0.11561248 -5.149148e-01  4.938206e-01  0.0292809836  4.945753e-01
## 184 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 185 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 186 -1.01610468 -1.742922e+00 -9.170841e-02 -0.1475777873 -4.963981e-02
## 187 -0.60482633 -1.731479e+00 -3.026789e-01 -0.1493064677 -2.132758e-01
## 188 -0.18401442  5.533043e-01 -1.637537e-01  0.0987563505  5.715891e-01
## 189 -1.22895077 -5.545101e-01 -1.420222e-01  0.0521252780  3.424541e-02
## 190 -0.90790580 -5.464402e-01  2.797033e-01  0.0531811800 -1.582959e-01
## 191 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 192 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 193 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 194 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 195 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 196 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 197 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 198 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 199 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 200 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 201 -0.54007471 -5.334480e-01 -5.917280e-01  0.0480650357 -2.370687e-01
## 202 -0.38698425 -5.210575e-01 -2.434347e-01  0.0267556667  6.998536e-01
## 203 -1.24450738 -3.119257e+00  1.476560e-01 -0.5191720619  5.467349e-02
## 204 -1.10441568 -5.521760e-01  2.192519e-01  0.0535549841 -5.936641e-02
## 205 -1.24450738 -3.119257e+00  1.476560e-01 -0.5191720619  5.467349e-02
## 206 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 207 -0.84708180 -5.437756e-01 -2.847309e-02  0.0515447174 -1.545861e-01
## 208 -0.61683112 -1.722869e+00  1.506288e-03 -0.1707303754  8.010902e-01
## 209 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 210  0.01600254 -5.184521e-01 -4.324348e-01  0.0474447660 -5.067750e-01
## 211 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 212 -1.06854636  5.171584e-01 -8.603795e-02  0.1247813522 -6.350595e-02
## 213 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 214 -0.08942466 -5.240656e-01 -1.536728e-01  0.0497494188 -4.743753e-01
## 215 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 216 -1.03244088 -5.487743e-01 -8.157084e-02  0.0517514739 -6.468404e-02
## 217 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 218 -1.05739556  5.178957e-01 -7.868437e-02  0.1246143046 -7.253331e-02
## 219 -1.10441568 -5.521760e-01  2.192519e-01  0.0535549841 -5.936641e-02
## 220 -0.84708180 -5.437756e-01 -2.847309e-02  0.0515447174 -1.545861e-01
## 221 -0.27985374 -5.280425e-01  1.381738e-01  0.0507574002 -4.333198e-01
## 222 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 223 -0.77510700 -5.403739e-01 -3.292959e-01  0.0497412073 -1.599038e-01
## 224 -0.90790580 -5.464402e-01  2.797033e-01  0.0531811800 -1.582959e-01
## 225 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 226 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 227 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 228 -0.84708180 -5.437756e-01 -2.847309e-02  0.0515447174 -1.545861e-01
## 229 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 230 -0.26870294 -5.273053e-01  1.455273e-01  0.0505903527 -4.423471e-01
## 231 -1.03244088 -5.487743e-01 -8.157084e-02  0.0517514739 -6.468404e-02
## 232 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 233 -1.10441568 -5.521760e-01  2.192519e-01  0.0535549841 -5.936641e-02
## 234 -0.44291123 -5.315667e-01  9.978318e-02  0.0506300617 -3.614724e-01
## 235 -0.05073817 -2.036720e-01  2.226700e-01  0.0818967887 -5.638611e-01
## 236 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 237 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 238 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 239 -0.71139591 -5.407043e-01  3.401546e-01  0.0528073759 -2.572253e-01
## 240 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 241 -0.90790580 -5.464402e-01  2.797033e-01  0.0531811800 -1.582959e-01
## 242 -1.08807948 -1.746324e+00  2.091144e-01 -0.1457742772 -4.432218e-02
## 243 -1.03244088 -5.487743e-01 -8.157084e-02  0.0517514739 -6.468404e-02
## 244 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 245 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 246 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 247 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 248 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 249 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 250 -0.63296117  5.313234e-01  5.856150e-02  0.1233783537 -2.918780e-01
## 251 -1.03244088 -5.487743e-01 -8.157084e-02  0.0517514739 -6.468404e-02
## 252 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 253 -0.65057191 -5.380398e-01  3.197825e-02  0.0511709133 -2.535156e-01
## 254 -0.86938340 -5.452501e-01 -4.318027e-02  0.0518788125 -1.365314e-01
## 255 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 256 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 257 -1.11821956  5.152312e-01  2.294920e-01  0.1262507672 -7.624305e-02
## 258 -0.83593100 -5.430384e-01 -2.111950e-02  0.0513776699 -1.636135e-01
## 259 -1.04624476  5.186329e-01 -7.133078e-02  0.1244472571 -8.156068e-02
## 260 -1.03244088 -5.487743e-01 -8.157084e-02  0.0517514739 -6.468404e-02
## 261 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 262 -0.83593100 -5.430384e-01 -2.111950e-02  0.0513776699 -1.636135e-01
## 263 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 264 -0.91059118  1.774528e-01  2.895169e-01  0.1134098255 -1.735280e-01
## 265 -1.03244088 -5.487743e-01 -8.157084e-02  0.0517514739 -6.468404e-02
## 266 -0.34834186 -8.759366e-02 -5.291512e-01  0.0898942149 -3.410063e-01
## 267 -0.44768826 -9.144823e-02  1.019087e-01  0.0928330450 -3.664805e-01
## 268 -0.76395620 -5.396366e-01 -3.219423e-01  0.0495741597 -1.689311e-01
## 269 -0.84708180 -5.437756e-01 -2.847309e-02  0.0515447174 -1.545861e-01
## 270 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 271 -0.63942111 -5.373025e-01  3.933184e-02  0.0510038658 -2.625429e-01
## 272 -0.10853254 -5.207862e-01 -7.937089e-01  0.0460150600 -4.131632e-01
## 273 -1.10441568 -5.521760e-01  2.192519e-01  0.0535549841 -5.936641e-02
## 274 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 275 -0.90790580 -5.464402e-01  2.797033e-01  0.0531811800 -1.582959e-01
## 276 -0.50863225 -5.263866e-01  3.729180e-01  0.0300285918  6.924342e-01
## 277 -0.51488603 -5.349684e-01  4.006059e-01  0.0524335718 -3.561548e-01
## 278  0.10178437 -8.026166e-01  2.497890e-01  0.0138123737 -6.178799e-01
## 279 -0.90790580 -5.464402e-01  2.797033e-01  0.0531811800 -1.582959e-01
## 280 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 281 -1.10441568 -5.521760e-01  2.192519e-01  0.0535549841 -5.936641e-02
## 282 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 283 -1.11821956  5.152312e-01  2.294920e-01  0.1262507672 -7.624305e-02
## 284 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 285 -0.31011243 -5.255004e-01 -5.092159e-01  0.0471900890 -3.630803e-01
## 286 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 287 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 288 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 289 -1.01610468 -1.742922e+00 -9.170841e-02 -0.1475777873 -4.963981e-02
## 290 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 291 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 292 -1.03765825 -1.294720e+01  1.291721e-01 -6.3666416344  1.686655e-02
## 293 -1.08500117 -5.477066e-01 -7.436677e-01  0.0485182578  2.361015e-02
## 294 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 295 -0.77779238  1.835191e-01 -3.194822e-01  0.1099698529 -1.751359e-01
## 296 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 297 -0.83212641 -1.322946e+00 -3.088783e-02 -0.0648184504 -1.491912e-01
## 298 -1.24450738 -3.119257e+00  1.476560e-01 -0.5191720619  5.467349e-02
## 299 -0.63942111 -5.373025e-01  3.933184e-02  0.0510038658 -2.625429e-01
## 300 -0.28823773 -9.108796e-01  1.287885e-01  0.0005396394 -4.197677e-01
## 301 -0.84708180 -5.437756e-01 -2.847309e-02  0.0515447174 -1.545861e-01
## 302 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 303 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 304 -0.63942111 -5.373025e-01  3.933184e-02  0.0510038658 -2.625429e-01
## 305 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 306 -1.10441568 -5.521760e-01  2.192519e-01  0.0535549841 -5.936641e-02
## 307 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 308 -0.25755214 -5.265680e-01  1.528809e-01  0.0504233051 -4.513745e-01
## 309 -0.09449466 -5.230439e-01  1.912715e-01  0.0505506437 -5.232218e-01
## 310  0.15139588 -1.094464e+00 -6.766792e-02 -0.0324808285 -6.009939e-01
## 311  0.12431683 -5.158336e-01  2.664300e-01  0.0498427445 -6.402060e-01
## 312 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 313 -0.51488603 -5.349684e-01  4.006059e-01  0.0524335718 -3.561548e-01
## 314 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 315 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 316 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 317 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 318 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 319 -0.76840528  8.620194e-01 -3.022777e-01  0.1239405894 -2.000623e-01
## 320 -1.04624476  5.186329e-01 -7.133078e-02  0.1244472571 -8.156068e-02
## 321 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 322 -1.10441568 -5.521760e-01  2.192519e-01  0.0535549841 -5.936641e-02
## 323 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 324 -1.22895077 -5.545101e-01 -1.420222e-01  0.0521252780  3.424541e-02
## 325 -1.10441568 -5.521760e-01  2.192519e-01  0.0535549841 -5.936641e-02
## 326 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 327 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 328 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 329 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 330 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 331 -1.03244088 -5.487743e-01 -8.157084e-02  0.0517514739 -6.468404e-02
## 332 -0.68371768 -5.325027e-01 -1.593038e+00  0.0429009709 -8.224483e-02
## 333 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 334 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 335 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 336 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 337 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 338 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 339 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 340 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 341 -1.04624476  5.186329e-01 -7.133078e-02  0.1244472571 -8.156068e-02
## 342 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 343 -1.24450738 -3.119257e+00  1.476560e-01 -0.5191720619  5.467349e-02
## 344 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 345 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 346 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 347 -1.04624476  5.186329e-01 -7.133078e-02  0.1244472571 -8.156068e-02
## 348 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 349 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 350 -1.08807948 -1.746324e+00  2.091144e-01 -0.1457742772 -4.432218e-02
## 351 -1.10441568 -5.521760e-01  2.192519e-01  0.0535549841 -5.936641e-02
## 352 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 353 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 354 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 355 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 356 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 357 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 358 -1.10441568 -5.521760e-01  2.192519e-01  0.0535549841 -5.936641e-02
## 359 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 360 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 361 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 362 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 363 -1.10441568 -5.521760e-01  2.192519e-01  0.0535549841 -5.936641e-02
## 364 -1.10441568 -5.521760e-01  2.192519e-01  0.0535549841 -5.936641e-02
## 365 -1.10441568 -5.521760e-01  2.192519e-01  0.0535549841 -5.936641e-02
## 366 -1.10441568 -5.521760e-01  2.192519e-01  0.0535549841 -5.936641e-02
## 367 -1.10441568 -5.521760e-01  2.192519e-01  0.0535549841 -5.936641e-02
## 368 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 369 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 370 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 371 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 372 -1.10441568 -5.521760e-01  2.192519e-01  0.0535549841 -5.936641e-02
## 373 -1.10441568 -5.521760e-01  2.192519e-01  0.0535549841 -5.936641e-02
## 374 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 375 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 376 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 377 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 378 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 379 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 380 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 381 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 382 -0.91059118  1.774528e-01  2.895169e-01  0.1134098255 -1.735280e-01
## 383 -1.10441568 -5.521760e-01  2.192519e-01  0.0535549841 -5.936641e-02
## 384 -1.11821956  5.152312e-01  2.294920e-01  0.1262507672 -7.624305e-02
## 385 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 386 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 387 -1.16719747 -6.726214e+00  1.373570e-01 -2.1369991058  5.466664e-02
## 388 -1.24450738 -3.119257e+00  1.476560e-01 -0.5191720619  5.467349e-02
## 389 -1.04359168 -5.495115e-01 -8.892443e-02  0.0519185215 -5.565668e-02
## 390 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 391 -1.10441568 -5.521760e-01  2.192519e-01  0.0535549841 -5.936641e-02
## 392 -1.10441568 -5.521760e-01  2.192519e-01  0.0535549841 -5.936641e-02
## 393 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 394 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 395 -1.10441568 -5.521760e-01  2.192519e-01  0.0535549841 -5.936641e-02
## 396 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 397 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 398 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 399 -1.03244088 -5.487743e-01 -8.157084e-02  0.0517514739 -6.468404e-02
## 400 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 401 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 402 -1.10441568 -5.521760e-01  2.192519e-01  0.0535549841 -5.936641e-02
## 403 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 404 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 405 -1.10441568 -5.521760e-01  2.192519e-01  0.0535549841 -5.936641e-02
## 406 -1.10441568 -5.521760e-01  2.192519e-01  0.0535549841 -5.936641e-02
## 407 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 408 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 409 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 410 -1.11821956  5.152312e-01  2.294920e-01  0.1262507672 -7.624305e-02
## 411 -1.11821956  5.152312e-01  2.294920e-01  0.1262507672 -7.624305e-02
## 412 -1.10441568 -5.521760e-01  2.192519e-01  0.0535549841 -5.936641e-02
## 413 -1.11821956  5.152312e-01  2.294920e-01  0.1262507672 -7.624305e-02
## 414 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 415 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 416 -0.26244916 -5.187234e-01  1.178394e-01  0.0281853727  6.062418e-01
## 417 -1.03244088 -5.487743e-01 -8.157084e-02  0.0517514739 -6.468404e-02
## 418 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 419 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 420 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 421 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 422 -1.03244088 -5.487743e-01 -8.157084e-02  0.0517514739 -6.468404e-02
## 423 -1.03244088 -5.487743e-01 -8.157084e-02  0.0517514739 -6.468404e-02
## 424 -1.10441568 -5.521760e-01  2.192519e-01  0.0535549841 -5.936641e-02
## 425 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 426 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 427 -0.90790580 -5.464402e-01  2.797033e-01  0.0531811800 -1.582959e-01
## 428 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 429 -1.11821956  5.152312e-01  2.294920e-01  0.1262507672 -7.624305e-02
## 430 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 431 -1.10441568 -5.521760e-01  2.192519e-01  0.0535549841 -5.936641e-02
## 432 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 433 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 434 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 435 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 436 -1.03244088 -5.487743e-01 -8.157084e-02  0.0517514739 -6.468404e-02
## 437 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 438 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 439 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 440 -1.06826131 -3.114740e+00  1.991177e-01 -0.5192245707 -3.179749e-02
## 441 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 442 -0.96046608 -5.453725e-01 -3.823936e-01  0.0499479638 -7.000167e-02
## 443 -1.24450738 -3.119257e+00  1.476560e-01 -0.5191720619  5.467349e-02
## 444 -1.30092557 -5.579119e-01  1.588006e-01  0.0539287881  3.956304e-02
## 445  3.73228883  1.937392e+00  1.079848e+00  0.0194402751 -4.209006e-01
## 446  4.64542861 -3.719960e-01  9.999571e-02 -0.0260403948  5.162148e-01
## 447  5.69067833 -3.464277e-01  3.744607e-01 -0.0262786489  3.096644e-02
## 448  3.58333336 -1.836075e-01  9.561145e-01  0.0187626025 -2.557802e-01
## 449  5.67431133 -4.035444e-01  5.737745e-01 -0.0429553346 -1.379935e-01
## 450  5.98781561  3.835762e-01  1.307845e+00  0.0270029188 -3.568485e-01
## 451  3.15845345  2.939084e+00 -3.817120e+00 -0.1336835677  4.590707e-01
## 452  3.45644590 -1.810320e-01 -7.996323e-01  0.0154737533  5.123507e-02
## 453  3.92316014  1.918735e+00 -1.654407e+00  0.0145094410 -8.725680e-02
## 454  4.05461892 -8.268886e-02 -7.161543e-01  0.0018004121  8.628762e-01
## 455  4.49694646 -1.870943e-01 -1.257492e+00 -0.0120257268  7.304541e-01
## 456  5.15699117  4.674406e-02 -1.434618e+01 -0.0320877846 -5.941654e-01
## 457  4.97814815 -2.845538e-01  1.784991e-01 -0.0169716440  3.688277e-01
## 458  5.19830085 -1.300509e-01 -4.475011e-01 -0.0039565739  3.602089e-01
## 459  7.87852926 -1.947220e-01 -1.487877e+00 -0.0623785607  1.603329e-01
## 460  4.90020675 -2.758447e-01 -1.475925e+00 -0.0239096301  5.761874e-01
## 461  4.81915633 -2.745843e-01 -2.505023e+00 -0.0270728355  7.403987e-01
## 462  4.56114416 -1.081473e-01 -9.386135e-01 -0.0020277778  6.872855e-01
## 463  4.15610529 -1.716012e-01  3.978206e-01 -0.0067941126  6.208295e-01
## 464  4.96507394 -2.620579e-01  1.004867e+00 -0.0198044839  1.530153e-01
## 465  3.92725571 -1.922986e-01  1.392527e+00  0.0176993869 -4.663113e-01
## 466  4.44422004  1.165683e-01  8.599116e-01  0.0155666114  3.985248e-01
## 467  5.29448724  2.474697e+00 -1.146298e-01 -0.0681062425  2.025600e-02
## 468  7.96844925  1.715674e-01  1.169205e+00 -0.0416717080  8.511821e-01
## 469  3.76205261 -4.036437e-01 -4.533350e-01 -0.0040710471 -7.012661e-02
## 470  3.81790375 -5.946767e-01  2.845488e-01 -0.0278679705 -2.235520e-01
## 471  3.92016411 -1.968381e-01  3.429868e-01  0.0156298074 -3.017169e-01
## 472  4.53959879 -1.934734e-01  9.448547e-02 -0.0079235046  5.444926e-01
## 473  6.14976508 -3.264901e-01 -5.377432e-01 -0.0525031018  9.921267e-01
## 474  5.86875326 -1.699124e-01 -2.092379e+00 -0.0258115713  1.334010e-01
## 475  6.45563758 -2.402314e-01  9.850841e-01 -0.0440137150  5.948578e-01
## 476  2.97847604 -2.981484e-01 -2.893967e+00  0.0205146781 -5.394932e-01
## 477  6.39902285 -3.831283e-01  9.668613e-03 -0.0410171567 -3.183262e-01
## 478  4.39381422 -2.081181e-01  7.957247e-01  0.0147737039 -5.570003e-01
## 479  3.83097430 -1.086377e-01 -6.639722e-02  0.0251884514 -1.754009e-01
## 480  3.70629861 -4.073299e-01 -4.901030e-01 -0.0032358094 -2.498979e-02
## 481  3.77522031 -1.123239e-01 -1.031652e-01  0.0260236891 -1.302641e-01
## 482  5.25506564 -1.235842e-01  2.865090e-01 -0.0033564094  2.083516e-01
## 483  3.97490872 -2.909318e-01  3.306860e-02  0.0042366692 -2.942435e-01
## 484  3.86542232 -2.927430e-01  1.354017e+00  0.0087779490 -4.174108e-01
## 485  5.37644887  1.941144e-02 -3.886278e+00 -0.0138471498  5.581328e-01
## 486  4.76591776 -9.867924e-02 -1.848435e+00 -0.0072712606  6.803600e-01
## 487  5.09019244 -1.991732e-01 -9.854006e-02 -0.0110883700  3.327265e-01
## 488  7.36635416  6.152938e-01 -3.461734e+00 -0.0176143207  4.911000e-01
## 489  5.80285828 -1.730550e-01  1.277792e+00 -0.0155203183 -2.824564e-01
## 490  5.82558924  7.126187e-02 -5.986226e-01  0.0094773939  9.225739e-02
## 491  6.28858815 -2.369146e-01  7.659124e-01 -0.0274046191 -4.511430e-01
## 492  5.38951964 -4.056612e-02  2.417492e-02  0.0008029615  1.541891e-01
## 493  5.61124764 -1.728647e-01 -1.844648e+00 -0.0232458110  2.286018e-01
## 494  4.86626021 -1.985876e-01 -1.051718e+00  0.0052822204 -5.614304e-01
## 495  6.34417760 -1.678097e-01 -2.451479e-01 -0.0230625523 -3.353517e-01
## 496  5.12765478 -3.546263e-01  2.797271e-01 -0.0281243833  2.461370e-01
## 497  3.93945461 -3.946284e-01 -1.032920e+00 -0.0081792099 -1.078440e-01
## 498  3.65646761 -2.806739e-01  2.089999e-01 -0.0136108164  9.036803e-01
## 499  3.23485892 -5.270846e-01  1.049188e-01 -0.0159956519  6.955839e-02
## 500  3.12229199 -2.922707e-01 -2.272642e+00  0.0026395856  4.121457e-01
## 501  5.15859856 -2.821214e-01 -2.140514e+00 -0.0247518362  5.933978e-01
## 502  6.23171666 -2.328377e-01  8.748913e-01 -0.0648037494  1.769436e+00
## 503 13.84232552  1.032482e+00  2.353493e+00 -0.1488872510  2.320101e-01
## 504 13.02411348  4.649273e-01  3.407404e+00 -0.0646890166 -7.623266e-01
## 505  9.04821175  1.421889e+00  2.263838e-01 -0.0018025341 -6.197996e-01
## 506 11.65657014  3.695299e-02  2.960083e+00 -0.0914185611 -4.830073e-02
## 507  9.64645264 -2.870050e-02  1.312655e-01 -0.0784273976  1.102972e-01
## 508 11.41455106 -9.630194e-02 -1.060142e+00 -0.0973506862 -5.195662e-01
## 509 11.03688479  1.039844e+00  3.863855e+00 -0.0369085555  5.399843e-02
## 510 13.66830851  7.805453e-01  3.661034e+00 -0.0537984996 -1.136777e+00
## 511 14.40634919  8.165875e-01  2.922997e+00 -0.0693745557 -1.427803e-01
## 512 14.98620509  9.176743e-01  3.646323e+00 -0.0751902767 -6.591795e-01
## 513 -0.44887359  1.129798e+00  1.157197e-01  0.1195132948 -3.919756e-01
## 514 -1.14986364  3.228596e+00  2.606076e-01 -0.1441052986 -1.339408e-01
## 515  0.84620923  3.098003e+00 -4.544196e-01 -0.1359444146  4.813318e-02
## 516 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 517  1.10416419  2.691945e+00  5.887499e-01 -0.0781609086  8.623294e-01
## 518 -0.55262718  1.508296e+00 -2.229547e-01  0.0989742229 -3.279051e-01
## 519 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 520 -0.84085132  3.240171e+00  3.821531e-02 -0.1469252033 -2.631048e-01
## 521 -1.14986364  3.228596e+00  2.606076e-01 -0.1441052986 -1.339408e-01
## 522 -1.14056787  2.386815e+00  2.501850e-01  0.0086343407 -1.138021e-01
## 523 -1.38690117  3.220422e+00  1.821770e-01 -0.1430889040 -1.009439e-02
## 524 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 525 -1.38690117  3.220422e+00  1.821770e-01 -0.1430889040 -1.009439e-02
## 526 -1.13035079  7.558061e+00  1.555190e-02 -1.7854515773 -2.615291e-01
## 527 -1.45695926  6.202100e+00  2.061978e-01 -1.1360884581 -7.126977e-02
## 528 -0.10368043  1.530276e+00 -4.452700e-01  0.0743522197  5.355620e-01
## 529 -1.14986364  3.228596e+00  2.606076e-01 -0.1441052986 -1.339408e-01
## 530 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 531 -1.31492637  3.223824e+00 -1.186457e-01 -0.1448924141 -1.541202e-02
## 532 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 533 -1.42317377  4.773500e+00  1.941371e-01 -0.5774025980 -3.978224e-02
## 534 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 535 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 536 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 537  1.25916284  3.926930e+00 -9.014542e-04 -0.3468418495  8.190732e-01
## 538 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 539 -1.31492637  3.223824e+00 -1.186457e-01 -0.1448924141 -1.541202e-02
## 540 -1.05814939  1.490985e+00 -6.101383e-02  0.1021679317 -9.981161e-02
## 541 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 542 -1.31492637  3.223824e+00 -1.186457e-01 -0.1448924141 -1.541202e-02
## 543 -1.31300966  6.208904e+00 -3.954477e-01 -1.1396954783 -8.190503e-02
## 544 -0.53247628  4.809009e+00 -1.472727e+00 -0.5900638008 -2.991609e-01
## 545 -1.38690117  3.220422e+00  1.821770e-01 -0.1430889040 -1.009439e-02
## 546 -0.84172450  2.104889e+00  1.833531e-02  0.0448571010 -2.281224e-01
## 547 -1.38690117  3.220422e+00  1.821770e-01 -0.1430889040 -1.009439e-02
## 548 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 549 -1.42317377  4.773500e+00  1.941371e-01 -0.5774025980 -3.978224e-02
## 550 -0.82515489  1.497655e+00 -3.291636e-01  0.1005045600 -1.713803e-01
## 551  0.63486413  1.559363e+00  7.294218e-02  0.0519470380  1.186889e+00
## 552  1.39869661  2.386302e+00 -6.869653e-01 -0.0358747368  9.072772e-01
## 553 -1.13012419  1.487583e+00  2.398089e-01  0.1039714419 -9.449398e-02
## 554 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 555 -1.27492310  1.484030e+00 -1.304548e-01  0.1028630311  1.157631e-02
## 556 -1.42317377  4.773500e+00  1.941371e-01 -0.5774025980 -3.978224e-02
## 557 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 558 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 559  0.09087831  3.602537e+00 -1.766527e-02 -0.2482625543  3.369452e-01
## 560 -0.40372019  2.921924e+00 -1.814964e-01 -0.0818915262 -4.192504e-01
## 561 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 562 -1.38690117  3.220422e+00  1.821770e-01 -0.1430889040 -1.009439e-02
## 563 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 564 -1.38690117  3.220422e+00  1.821770e-01 -0.1430889040 -1.009439e-02
## 565 -0.48684751  2.418264e+00 -8.819521e-01 -0.0212311453  7.427395e-01
## 566 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 567 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 568 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 569 -1.42317377  4.773500e+00  1.941371e-01 -0.5774025980 -3.978224e-02
## 570 -1.06930019  1.490247e+00 -6.836742e-02  0.1023349793 -9.078425e-02
## 571 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 572 -0.64013882  1.027704e+00  6.085282e-02  0.1225684722 -2.980560e-01
## 573 -1.06859307  2.390217e+00 -5.063775e-02  0.0068308306 -1.191197e-01
## 574 -1.13012419  1.487583e+00  2.398089e-01  0.1039714419 -9.449398e-02
## 575 -1.37783166  7.441460e+00 -4.820609e-02 -5.8608216424 -2.334459e-01
## 576 -0.65887584  1.511038e+00  3.220087e-02  0.0790153436  7.509184e-01
## 577  0.04582888  2.258967e+00 -6.327556e-02  0.0039951648  4.081952e-01
## 578 -1.39613526  6.204765e+00 -1.019786e-01 -1.1377249206 -6.756004e-02
## 579 -1.13012419  1.487583e+00  2.398089e-01  0.1039714419 -9.449398e-02
## 580 -0.65887584  1.511038e+00  3.220087e-02  0.0790153436  7.509184e-01
## 581 -1.38690117  3.220422e+00  1.821770e-01 -0.1430889040 -1.009439e-02
## 582 -1.13012419  1.487583e+00  2.398089e-01  0.1039714419 -9.449398e-02
## 583 -0.80285329  1.499129e+00 -3.144564e-01  0.1001704649 -1.894351e-01
## 584 -0.02469415  2.992460e+00 -7.046155e-01 -0.0971538322 -5.542510e-01
## 585 -0.64013882  1.027704e+00  6.085282e-02  0.1225684722 -2.980560e-01
## 586 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 587 -1.06930019  1.490247e+00 -6.836742e-02  0.1023349793 -9.078425e-02
## 588 -0.84948983  4.292680e+00  5.080807e-02 -0.4205065558 -2.902459e-01
## 589 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 590 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 591 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 592 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 593 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 594 -1.42317377  4.773500e+00  1.941371e-01 -0.5774025980 -3.978224e-02
## 595 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 596 -0.58741023  2.405797e+00 -2.330034e-01  0.0039840166 -3.235622e-01
## 597 -0.84152353  2.684322e+00  2.826577e-02 -0.0392514249 -2.454431e-01
## 598 -1.38690117  3.220422e+00  1.821770e-01 -0.1430889040 -1.009439e-02
## 599 -1.42317377  4.773500e+00  1.941371e-01 -0.5774025980 -3.978224e-02
## 600 -1.06859307  2.390217e+00 -5.063775e-02  0.0068308306 -1.191197e-01
## 601 -1.38690117  3.220422e+00  1.821770e-01 -0.1430889040 -1.009439e-02
## 602 -1.06930019  1.490247e+00 -6.836742e-02  0.1023349793 -9.078425e-02
## 603 -1.42317377  4.773500e+00  1.941371e-01 -0.5774025980 -3.978224e-02
## 604 -1.38690117  3.220422e+00  1.821770e-01 -0.1430889040 -1.009439e-02
## 605 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 606 -1.13012419  1.487583e+00  2.398089e-01  0.1039714419 -9.449398e-02
## 607 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 608 -1.42317377  4.773500e+00  1.941371e-01 -0.5774025980 -3.978224e-02
## 609 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 610 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 611 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 612 -0.25795937  1.514380e+00  1.726284e-01  0.1003898195 -4.911991e-01
## 613 -0.69162111  2.408796e+00  2.786977e-02 -0.0159876625  7.496650e-01
## 614 -1.38690117  3.220422e+00  1.821770e-01 -0.1430889040 -1.009439e-02
## 615 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 616 -1.38690117  3.220422e+00  1.821770e-01 -0.1430889040 -1.009439e-02
## 617 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 618 -0.39277775  2.126870e+00 -2.039799e-01  0.0202350978  6.353447e-01
## 619 -1.06930019  1.490247e+00 -6.836742e-02  0.1023349793 -9.078425e-02
## 620 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 621 -1.27492310  1.484030e+00 -1.304548e-01  0.1028630311  1.157631e-02
## 622 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 623 -0.70096282  1.025039e+00  3.690292e-01  0.1242049348 -3.017657e-01
## 624 -0.44210214  1.517993e+00  1.016418e-01  0.0783202442  6.395305e-01
## 625 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 626 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 627 -1.08045099  1.489510e+00 -7.572101e-02  0.1025020268 -8.175688e-02
## 628 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 629 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 630 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 631 -1.13012419  1.487583e+00  2.398089e-01  0.1039714419 -9.449398e-02
## 632 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 633 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 634 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 635 -1.13012419  1.487583e+00  2.398089e-01  0.1039714419 -9.449398e-02
## 636 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 637 -1.34689790  1.480628e+00  1.703680e-01  0.1046665412  1.689394e-02
## 638  0.78918798 -4.836474e-01 -8.583535e-01  0.0198102110  2.073082e-01
## 639  1.00278534 -7.088775e-01 -1.597409e-01 -0.0052339285  5.127946e-02
## 640  1.12667133 -6.856728e-01  2.015548e-01 -0.0009925920 -4.239121e-02
## 641  1.39938059 -1.000731e-01  3.116598e-01  0.0595097657 -2.076964e-01
## 642  2.08880027 -2.841279e-01  4.577251e-01  0.0179838620  5.306159e-01
## 643  1.86907387 -4.462638e-01 -2.445714e-01 -0.0025329408  6.947202e-01
## 644  1.34294763 -2.649631e-01 -3.522593e-01  0.0414384909 -1.153585e-01
## 645  1.19899803 -2.717666e-01  2.493862e-01  0.0450455111 -1.047233e-01
## 646  1.13542163 -4.770979e-01  5.557059e-01  0.0252346490 -1.043191e-01
## 647  1.13542163 -4.770979e-01  5.557059e-01  0.0252346490 -1.043191e-01
## 648  1.61663700 -4.625088e-01  3.819515e-02  0.0217152583 -2.676764e-01
## 649  2.37068821  1.305692e+00 -8.874714e-02  0.0391933485  1.448826e+00
## 650  1.47302858 -1.002440e+00  6.417417e-01 -0.0483818277 -2.543192e-01
## 651  2.82324089 -4.208179e-01 -3.093198e-01 -0.0047020435  2.760015e-01
## 652  1.41394021  8.015788e-02  3.208568e-01  0.0726710034 -2.208722e-01
## 653  1.49134638 -1.277677e-01  6.508415e-01  0.0590900061 -2.741198e-01
## 654  0.64074711  3.188237e-01 -6.031681e-01  0.0870223750  2.623543e-01
## 655  1.69218954  1.926965e+00  4.018562e-01  0.0216336396  6.477869e-01
## 656  0.38182369 -5.006102e-01 -3.612809e-01  0.0247933205  3.710371e-01
## 657  0.99658477 -4.635313e-01 -5.916672e+00  0.0145598595 -4.678250e-01
## 658  0.70868557 -4.771384e-01 -4.713381e+00  0.0217738999 -4.465545e-01
## 659  1.47167660 -4.720930e-01 -5.740152e-02  0.0238868763 -1.503207e-01
## 660  1.10538799  1.181230e-01  8.841687e-01  0.0792995132 -1.385929e-01
## 661  2.34533453  7.717859e-03  9.034771e-01  0.0423142847  3.297955e-01
## 662  0.78734401 -2.413456e-01 -2.311185e-01  0.0495855904  1.598773e-01
## 663  2.07607772 -3.170126e-01 -5.641488e-01  0.0362916954 -3.533102e-01
## 664  1.09588843 -4.810685e-01  1.813473e-01  0.0251016143 -1.936307e-02
## 665  0.53355740 -5.046463e-01  4.974200e-02  0.0481268639 -7.982457e-01
## 666  0.04860823 -1.998174e-01 -4.083899e-01  0.0789579586 -5.383869e-01
## 667  0.15168843 -5.153807e-01 -6.380709e-02  0.0487074245 -6.094142e-01
## 668  2.21495732 -3.091874e-01 -8.208500e-01  0.0334859001 -4.127920e-01
## 669  1.89915957 -4.556289e-01  7.828041e-01  0.0240735277 -4.819821e-01
## 670  2.02254157 -1.035025e-01 -1.785155e+00  0.0453301154 -2.805513e-01
## 671  1.51899475 -3.001021e-01 -7.234069e-01  0.0401682104 -8.371479e-02
## 672  0.27740729 -5.034431e-01  6.147233e-01  0.0285333754  2.967164e-01
## 673  0.77897412 -2.713225e-01 -1.181085e+00  0.0649690153 -7.875922e-01
## 674  0.51243958 -4.965172e-01  3.522911e-01  0.0268572039  2.195514e-01
## 675  0.68301053  1.076737e+00 -2.229254e-01  0.0943520469  1.631097e-01
## 676  2.09770706 -4.592565e-01 -1.593415e+00  0.0185922921 -2.119037e-01
## 677  2.13025571 -3.983047e-02 -5.311552e-01  0.0602866175 -3.972892e-01
## 678  2.10344932 -3.165598e-01 -8.943859e-01  0.0351563755 -3.225184e-01
## 679  1.01494575 -4.832342e-01 -8.477547e-01  0.0215683159  1.448598e-01
## 680  1.49641638 -1.287893e-01  3.058972e-01  0.0582887813 -2.252732e-01
## 681  1.46052580 -4.728302e-01 -6.475511e-02  0.0240539238 -1.412933e-01
## 682  0.81437666 -4.851679e-01  1.339805e-01  0.0241787470  8.822220e-02
## 683  0.72394438 -7.443207e-01  7.325070e-02 -0.0063858271  1.646250e-01
## 684  0.11534894 -5.145975e-01 -1.063495e+00  0.0445059360 -4.813008e-01
## 685  0.30831944  2.243792e-01 -6.816910e-01  0.0827698222  4.098762e-01
## 686  1.16279323 -4.766451e-01  2.254688e-01  0.0240993290 -7.352725e-02
## 687  0.32708049 -5.015158e-01  2.991934e-01  0.0270639604  3.094535e-01
## 688  2.76342879 -3.064989e-01 -7.128627e-02  0.0130925384  3.320134e-01
## 689  0.14361106 -8.904690e-01 -1.676148e+00 -0.0102814213 -4.516735e-01
## 690  0.27740729 -5.034431e-01  6.147233e-01  0.0285333754  2.967164e-01
## 691  1.74969446 -2.684024e-01 -3.236228e-01  0.0191046924  7.899663e-01
## 692  1.82629708  6.927930e-01 -8.735318e-01  0.0900982096 -2.853846e-01
## 693  1.32078072 -4.720993e-01  6.088037e-01  0.0250278924 -1.942212e-01
## 694  1.78087827 -4.493812e-01  3.938420e-01  0.0002388417  6.602186e-01
## 695  0.53202005 -2.545957e-01 -9.259787e-01  0.0691311584 -7.014879e-01
## 696  2.14433186 -4.507464e-01 -1.695167e-01  0.0207949064 -4.614540e-01
## 697  1.84948637 -4.575562e-01  1.098334e+00  0.0255429427 -4.947192e-01
## 698  0.79387971 -1.115289e-03 -5.741520e-01  0.0686926259  2.043665e-01
## 699  1.46153660 -4.700496e-01  6.324871e-01  0.0254893260 -2.480138e-01
## 700  0.54470820 -5.039090e-01  5.709559e-02  0.0479598164 -8.072731e-01
## 701  2.01355549 -2.723917e-01 -2.190656e-01  0.0163134193  6.369224e-01
## 702  1.98873295  6.343488e-02  4.597676e-01  0.0466396605  5.491526e-01
## 703  0.16283923 -5.146435e-01 -5.645350e-02  0.0485403770 -6.184416e-01
## 704  1.32907329 -6.950062e-01 -4.629456e-01 -0.0280184088  1.014048e+00
## 705  2.64176803 -4.364417e-01 -1.024618e+00  0.0163072432 -5.849922e-01
## 706  0.02009300  4.050595e-01 -7.416226e-02  0.1166291545 -5.786362e-01
## 707  1.61327114 -2.952258e-01 -1.009522e+00  0.0380306053 -1.070871e-01
## 708  0.85188826 -4.867584e-01 -8.861452e-01  0.0214409773  2.167071e-01
## 709  0.76876266 -4.908974e-01 -5.926761e-01  0.0234115350  2.310521e-01
## 710  0.46612605 -2.562386e-01 -2.728581e-01  0.0715688458 -7.540442e-01
## 711  1.96594886  3.213470e-01 -1.198530e+00  0.0787041948 -2.816476e-01
## 712  0.56877231  3.154220e-01 -3.023453e-01  0.0888258851  2.676719e-01
## 713  0.38705778 -1.824284e-01 -6.998837e-03  0.0574418331  3.086334e-01
## 714  2.70103577 -5.758850e-01 -1.923059e+00 -0.0339839408  4.598538e-01
## 715  2.19641412 -1.754155e-01 -1.531011e+00  0.0456257832 -2.919385e-01
## 716  2.12575092 -3.150853e-01 -8.796787e-01  0.0348222804 -3.405731e-01
## 717  2.08756706 -4.572131e-01 -9.035268e-01  0.0201947418 -3.095968e-01
## 718  1.00379495 -4.839715e-01 -8.551083e-01  0.0217353634  1.538871e-01
## 719  1.04376349  9.883017e-01 -1.299336e-01  0.0959881826 -1.496280e-03
## 720  0.17944767 -2.374664e-01 -3.921040e-01  0.0760962237 -5.830072e-01
## 721  1.73360731 -2.671921e-01 -1.209002e+00  0.0343410371 -2.121270e-01
## 722  1.55788981  8.696141e-02 -2.807888e-01  0.0690639832 -2.315075e-01
## 723  2.75430194 -3.648436e-02 -1.930724e+00  0.0479794095 -5.768779e-01
## 724  2.61898215 -5.547679e-01  1.331024e+00  0.0099826418 -8.776105e-01
## 725  1.45646660 -4.690279e-01  9.774314e-01  0.0262905509 -2.968603e-01
## 726  0.50517500 -5.078796e-01 -3.172631e-01  0.0478267816 -7.223171e-01
## 727  0.88020847 -2.628327e-01  8.053098e-01  0.0506329173 -1.328475e-02
## 728  0.22484701 -5.023755e-01 -4.737354e-02  0.0253001593  3.850105e-01
## 729  0.21038222 -8.869715e-01 -4.090566e-01 -0.0255517788  4.564365e-01
## 730  1.94153623 -1.572738e-01  8.084616e-01  0.0535894086 -5.169476e-01
## 731  1.54710037 -1.240815e-01  6.876094e-01  0.0582547684 -3.192566e-01
## 732  1.28631752 -4.770916e-01 -1.104993e-01  0.0240936328 -6.041860e-02
## 733  1.50655638 -1.308327e-01 -3.839914e-01  0.0566863315 -1.275801e-01
## 734  2.49991948 -3.084833e-01 -1.398821e+00  0.0294942500 -4.771919e-01
## 735  2.94761042 -2.707231e-01  1.870006e-02 -0.0103815888  1.236112e+00
## 736  1.48524181 -6.443898e-01  3.004299e-01  0.0030011074 -2.132598e-01
## 737  0.16790923 -5.156652e-01 -4.013978e-01  0.0477391521 -5.695950e-01
## 738  2.51720099 -1.309855e-01 -3.751507e-01  0.0248932554  4.027856e-01
## 739  2.86954740 -4.304674e-01  3.804651e-01  0.0209361526 -8.608816e-01
## 740  2.40267764 -3.253625e-01 -4.873845e-01  0.0349427590 -4.969521e-01
## 741  3.24806485 -2.959035e-01  1.502916e+00  0.0125796238 -1.514633e-01
## 742  1.51729060 -4.663634e-01  6.692550e-01  0.0246540883 -2.931506e-01
## 743  0.36057362 -8.287587e-01 -3.779639e-01 -0.0171293333  3.934735e-01
## 744  1.19798723 -2.745472e-01 -4.478560e-01  0.0436101089  1.997194e-03
## 745  1.56088300 -4.661950e-01  1.427199e-03  0.0225504960 -2.225396e-01
## 746  0.90702978  1.700470e-01  8.237860e-01  0.0831606033 -3.991160e-02
## 747  1.66823592 -3.028754e-01  1.047045e+00  0.0429059475 -4.087799e-01
## 748  0.06944108  6.973047e-01 -3.876870e-01  0.1210911670 -5.708064e-01
## 749  1.54129635 -2.986276e-01 -7.086997e-01  0.0398341154 -1.017695e-01
## 750  1.58005435  3.657586e-01  1.056150e-02  0.0873393833 -2.429578e-01
## 751  1.65200399 -2.535880e-01 -1.015116e+00  0.0181868809  9.143109e-01
## 752  1.62196567 -2.754904e-01 -5.956799e-02  0.0217434402  8.404208e-01
## 753  1.20113423 -8.944928e-01 -4.460620e-01 -0.0335707939  5.128263e-03
## 754  0.86693695 -4.862355e-01  7.960774e-01  0.0274119632 -7.199152e-05
## 755  0.94831774 -4.325548e-02  1.540718e-01  0.0668559637  3.501774e-02
## 756  2.11814404 -4.415956e-01  4.779768e-01  0.0003264712  5.074965e-01
## 757  0.97024245  3.819669e-01  5.174993e-01  0.0915132617 -4.058114e-02
## 758  1.51630306  2.046795e-01  1.014149e+00  0.0826446567 -3.492292e-01
## 759  0.83194721 -2.383967e-01 -2.017041e-01  0.0489174003  1.237679e-01
## 760  0.18667144  2.190501e-01 -6.533826e-02  0.0860427473  4.024568e-01
## 761 -0.03904569 -1.492415e-01 -1.092489e+00  0.0806511810 -4.232073e-01
## 762  0.29433386 -1.308308e-01 -3.461534e-01  0.0599362803  3.749664e-01
## 763  1.36437312 -4.719309e-01 -5.902414e-02  0.0229243001 -1.236101e-01
## 764  1.02102655 -4.814753e-01 -4.954568e-01  0.0222024932  8.698585e-02
## 765  0.74747186 -4.895913e-01  8.985895e-02  0.0251810323  1.423864e-01
## 766  0.94610247 -2.611898e-01  1.521892e-01  0.0481952299  3.927154e-02
## 767  2.48973113 -1.753282e-01 -3.622084e-01  0.0445049590 -6.276221e-01
## 768  0.58441438 -4.931154e-01  5.146838e-02  0.0250536937  2.142337e-01
## 769  1.15439483 -2.747156e-01  2.199718e-01  0.0457137013 -6.861382e-02
## 770  0.57886952  5.841211e-01  3.748832e-01  0.0760042739  1.199265e+00
## 771  1.34636171 -2.846538e-01  6.253490e-01  0.0444939076 -2.163307e-01
## 772  0.50010500 -5.068580e-01  2.768124e-02  0.0486280065 -7.711636e-01
## 773  0.78880971 -9.361987e-05 -2.292077e-01  0.0694938508  1.555199e-01
## 774  2.87185167 -7.812830e-02 -5.992221e-01  0.0509314979 -7.623387e-01
## 775  0.07323329 -6.606560e-02 -4.212293e-01  0.0664075316  4.916690e-01
## 776  0.32300963 -5.081244e-01 -9.956897e-01  0.0439650844 -5.892576e-01
## 777  1.43556861 -6.463171e-01  6.159598e-01  0.0044705224 -2.259969e-01
## 778  0.93283095 -4.845927e-01  1.429567e-01  0.0249742757  5.248429e-02
## 779  2.17060896  1.370220e-01 -1.132590e+00  0.0677155041 -3.853360e-01
## 780  1.73628667  2.110826e-01 -9.305058e-01  0.0749974993 -2.096151e-01
## 781  0.38182369 -5.006102e-01 -3.612809e-01  0.0247933205  3.710371e-01
## 782  0.55837898 -1.751720e-01 -9.388815e-01  0.0526994929  3.287899e-01
## 783  0.97292477 -1.963375e-01  1.392697e-01  0.0305922723  1.069606e+00
## 784  0.94196134 -7.115420e-01  1.484355e-01 -0.0035974659  4.756973e-02
##              PC6           PC7           PC8
## 1   -0.002080531  0.0055937328  4.271075e-04
## 2    0.031270144  0.0035345606  4.657184e-04
## 3    0.028419375  0.0041968610  4.942512e-04
## 4   -0.001195833  0.0094399247  4.560014e-04
## 5   -0.002080531  0.0055937328  4.271075e-04
## 6   -0.002080531  0.0055937328  4.271075e-04
## 7   -0.001195833  0.0094399247  4.560014e-04
## 8   -0.001195833  0.0094399247  4.560014e-04
## 9    0.029044455  0.0050494016  5.911406e-04
## 10  -0.001195833  0.0094399247  4.560014e-04
## 11  -0.002080531  0.0055937328  4.271075e-04
## 12   0.029044455  0.0050494016  5.911406e-04
## 13  -0.001195833  0.0094399247  4.560014e-04
## 14   0.029044455  0.0050494016  5.911406e-04
## 15  -0.002705611  0.0047411921  3.302181e-04
## 16  -0.001195833  0.0094399247  4.560014e-04
## 17   0.147374185 -0.0112496533  7.967547e-04
## 18  -0.001195833  0.0094399247  4.560014e-04
## 19  -0.002080531  0.0055937328  4.271075e-04
## 20  -0.002965229  0.0017475408  3.982137e-04
## 21  -0.008271007 -0.0043960554  4.127760e-04
## 22   0.110013551 -0.0101586476  5.552314e-04
## 23  -0.001195833  0.0094399247  4.560014e-04
## 24   0.006270714 -0.0010788706  4.624593e-04
## 25   0.114479803 -0.0183977061  5.749339e-04
## 26   0.033031373  0.0356928932 -1.379033e-03
## 27  -0.001195833  0.0094399247  4.560014e-04
## 28  -0.091284458 -0.0037771076  1.144496e-04
## 29   0.090507629 -0.0460132050  5.041598e-04
## 30   0.116508819 -0.0077116709  5.647260e-04
## 31   0.038280398  0.0022229902  6.553863e-04
## 32   0.008169099  0.0091601751  1.506343e-04
## 33   0.008040111  0.0066135133  5.202470e-04
## 34  -0.001195833  0.0094399247  4.560014e-04
## 35  -0.001195833  0.0094399247  4.560014e-04
## 36  -0.001195833  0.0094399247  4.560014e-04
## 37  -0.001195833  0.0094399247  4.560014e-04
## 38   0.029044455  0.0050494016  5.911406e-04
## 39  -0.001195833  0.0094399247  4.560014e-04
## 40  -0.001195833  0.0094399247  4.560014e-04
## 41   0.124722083 -0.0099280609  8.123527e-04
## 42  -0.001195833  0.0094399247  4.560014e-04
## 43   0.117133898 -0.0068591302  6.616154e-04
## 44   0.117133898 -0.0068591302  6.616154e-04
## 45   0.033031373  0.0356928932 -1.379033e-03
## 46  -0.001195833  0.0094399247  4.560014e-04
## 47   0.028159756  0.0012032097  5.622467e-04
## 48   0.008040111  0.0066135133  5.202470e-04
## 49  -0.001195833  0.0094399247  4.560014e-04
## 50  -0.001195833  0.0094399247  4.560014e-04
## 51   0.148258884 -0.0074034614  8.256485e-04
## 52   0.156737716 -0.0029897026  3.695482e-04
## 53  -0.001195833  0.0094399247  4.560014e-04
## 54  -0.002080531  0.0055937328  4.271075e-04
## 55  -0.001195833  0.0094399247  4.560014e-04
## 56  -0.001195833  0.0094399247  4.560014e-04
## 57  -0.001195833  0.0094399247  4.560014e-04
## 58  -0.001195833  0.0094399247  4.560014e-04
## 59  -0.001195833  0.0094399247  4.560014e-04
## 60  -0.001195833  0.0094399247  4.560014e-04
## 61  -0.001195833  0.0094399247  4.560014e-04
## 62   0.093597097 -0.0093837297  6.483197e-04
## 63   0.006398301  0.0100074915 -2.899282e-05
## 64  -0.001195833  0.0094399247  4.560014e-04
## 65   0.076555524 -0.0221734284  5.108382e-04
## 66   0.028159756  0.0012032097  5.622467e-04
## 67   0.148258884 -0.0074034614  8.256485e-04
## 68  -0.002080531  0.0055937328  4.271075e-04
## 69  -0.001195833  0.0094399247  4.560014e-04
## 70  -0.001195833  0.0094399247  4.560014e-04
## 71   0.006270714 -0.0010788706  4.624593e-04
## 72  -0.001195833  0.0094399247  4.560014e-04
## 73   0.117133898 -0.0068591302  6.616154e-04
## 74  -0.001195833  0.0094399247  4.560014e-04
## 75  -0.001195833  0.0094399247  4.560014e-04
## 76   0.141138537 -0.0107029788  7.192645e-04
## 77   0.148258884 -0.0074034614  8.256485e-04
## 78  -0.028271427 -0.0084694426  3.271302e-04
## 79  -0.001195833  0.0094399247  4.560014e-04
## 80  -0.001195833  0.0094399247  4.560014e-04
## 81  -0.001195833  0.0094399247  4.560014e-04
## 82  -0.001195833  0.0094399247  4.560014e-04
## 83  -0.020084580  0.0048781076  3.429694e-04
## 84   0.084361154 -0.0065573183  5.840740e-04
## 85   0.003691175  0.0213951375 -8.817964e-05
## 86   0.021924108  0.0017498842  4.847565e-04
## 87  -0.001195833  0.0094399247  4.560014e-04
## 88  -0.001195833  0.0094399247  4.560014e-04
## 89   0.058400043 -0.0031873134  6.973860e-04
## 90   0.017276054  0.0037871019  5.844927e-04
## 91  -0.001195833  0.0094399247  4.560014e-04
## 92  -0.001195833  0.0094399247  4.560014e-04
## 93  -0.002080531  0.0055937328  4.271075e-04
## 94  -0.001195833  0.0094399247  4.560014e-04
## 95  -0.003728290  0.0053512136  5.135992e-04
## 96  -0.001195833  0.0094399247  4.560014e-04
## 97  -0.001195833  0.0094399247  4.560014e-04
## 98  -0.001195833  0.0094399247  4.560014e-04
## 99  -0.001195833  0.0094399247  4.560014e-04
## 100 -0.001195833  0.0094399247  4.560014e-04
## 101 -0.001195833  0.0094399247  4.560014e-04
## 102 -0.002705611  0.0047411921  3.302181e-04
## 103  0.029044455  0.0050494016  5.911406e-04
## 104 -0.001195833  0.0094399247  4.560014e-04
## 105 -0.050748880  0.0053089910  1.113521e-04
## 106  0.023736264 -0.0180277501  4.177775e-04
## 107 -0.001195833  0.0094399247  4.560014e-04
## 108  0.033031373  0.0356928932 -1.379033e-03
## 109  0.029929153  0.0088955936  6.200344e-04
## 110 -0.001195833  0.0094399247  4.560014e-04
## 111  0.117133898 -0.0068591302  6.616154e-04
## 112  0.168629155 -0.0028172385  6.423148e-04
## 113 -0.002080531  0.0055937328  4.271075e-04
## 114 -0.001195833  0.0094399247  4.560014e-04
## 115 -0.031742887  0.0082268956  2.530377e-04
## 116  0.038540017  0.0052166415  5.873907e-04
## 117 -0.001195833  0.0094399247  4.560014e-04
## 118  0.029044455  0.0050494016  5.911406e-04
## 119  0.057515345 -0.0070335054  6.684921e-04
## 120  0.049017412 -0.0201449050  6.582951e-04
## 121 -0.001195833  0.0094399247  4.560014e-04
## 122  0.021924108  0.0017498842  4.847565e-04
## 123 -0.004612988  0.0015050216  4.847053e-04
## 124 -0.001195833  0.0094399247  4.560014e-04
## 125 -0.001195833  0.0094399247  4.560014e-04
## 126  0.136750102 -0.0056721098  7.510051e-04
## 127 -0.133171508  0.0068009805  1.169418e-04
## 128 -0.058390076  0.0033709452  3.362703e-04
## 129 -0.001195833  0.0094399247  4.560014e-04
## 130 -0.002080531  0.0055937328  4.271075e-04
## 131 -0.013848931  0.0043314330  4.204596e-04
## 132 -0.001195833  0.0094399247  4.560014e-04
## 133  0.029929153  0.0088955936  6.200344e-04
## 134 -0.001195833  0.0094399247  4.560014e-04
## 135 -0.001195833  0.0094399247  4.560014e-04
## 136  0.029929153  0.0088955936  6.200344e-04
## 137 -0.002624446 -0.0007536557  2.176112e-04
## 138 -0.002080531  0.0055937328  4.271075e-04
## 139  0.117133898 -0.0068591302  6.616154e-04
## 140 -0.001195833  0.0094399247  4.560014e-04
## 141 -0.001195833  0.0094399247  4.560014e-04
## 142 -0.001195833  0.0094399247  4.560014e-04
## 143 -0.001195833  0.0094399247  4.560014e-04
## 144 -0.001195833  0.0094399247  4.560014e-04
## 145 -0.001195833  0.0094399247  4.560014e-04
## 146 -0.001195833  0.0094399247  4.560014e-04
## 147 -0.008740193  0.0021807677  2.531392e-04
## 148 -0.001195833  0.0094399247  4.560014e-04
## 149  0.147633804 -0.0082560020  7.287591e-04
## 150 -0.001195833  0.0094399247  4.560014e-04
## 151 -0.001195833  0.0094399247  4.560014e-04
## 152 -0.001195833  0.0094399247  4.560014e-04
## 153 -0.002080531  0.0055937328  4.271075e-04
## 154 -0.001195833  0.0094399247  4.560014e-04
## 155 -0.039155129 -0.0058855504  3.493762e-04
## 156 -0.011725486  0.0142637699  1.386112e-04
## 157 -0.001195833  0.0094399247  4.560014e-04
## 158 -0.001195833  0.0094399247  4.560014e-04
## 159  0.029929153  0.0088955936  6.200344e-04
## 160 -0.001195833  0.0094399247  4.560014e-04
## 161 -0.001195833  0.0094399247  4.560014e-04
## 162 -0.001195833  0.0094399247  4.560014e-04
## 163  0.019399499  0.0137194387  3.026443e-04
## 164 -0.029744536  0.0037448793  1.822456e-04
## 165 -0.001195833  0.0094399247  4.560014e-04
## 166  0.029044455  0.0050494016  5.911406e-04
## 167 -0.111864994 -0.0195775197  4.994763e-05
## 168 -0.019623895  0.0047646599  2.753851e-04
## 169 -0.055857619  0.0074596564  2.786725e-04
## 170  0.029044455  0.0050494016  5.911406e-04
## 171  0.008040111  0.0066135133  5.202470e-04
## 172  0.005386016 -0.0049250626  4.335655e-04
## 173 -0.013848931  0.0043314330  4.204596e-04
## 174 -0.001195833  0.0094399247  4.560014e-04
## 175 -0.001195833  0.0094399247  4.560014e-04
## 176  0.038621181 -0.0002782063  4.747838e-04
## 177 -0.001195833  0.0094399247  4.560014e-04
## 178 -0.003728290  0.0053512136  5.135992e-04
## 179  0.146489487 -0.0150958453  7.678608e-04
## 180  0.124600445 -0.0173779256  6.680734e-04
## 181  0.120731565 -0.0102972012  5.011417e-04
## 182  0.151856551 -0.0108415324  6.651748e-04
## 183  0.114479803 -0.0183977061  5.749339e-04
## 184 -0.001195833  0.0094399247  4.560014e-04
## 185 -0.001195833  0.0094399247  4.560014e-04
## 186  0.037523287  0.0094631604  1.350403e-04
## 187 -0.011535779 -0.0099745889  1.780223e-04
## 188  0.143887062  0.0000818987  5.343054e-04
## 189  0.029929153  0.0088955936  6.200344e-04
## 190 -0.002965229  0.0017475408  3.982137e-04
## 191 -0.001195833  0.0094399247  4.560014e-04
## 192 -0.001195833  0.0094399247  4.560014e-04
## 193 -0.001195833  0.0094399247  4.560014e-04
## 194 -0.001195833  0.0094399247  4.560014e-04
## 195 -0.001195833  0.0094399247  4.560014e-04
## 196 -0.001195833  0.0094399247  4.560014e-04
## 197 -0.001195833  0.0094399247  4.560014e-04
## 198 -0.001195833  0.0094399247  4.560014e-04
## 199 -0.001195833  0.0094399247  4.560014e-04
## 200 -0.001195833  0.0094399247  4.560014e-04
## 201  0.005507654  0.0025248021  5.778448e-04
## 202  0.136490483 -0.0086657611  8.190006e-04
## 203  0.033031373  0.0356928932 -1.379033e-03
## 204 -0.002080531  0.0055937328  4.271075e-04
## 205  0.033031373  0.0356928932 -1.379033e-03
## 206 -0.001195833  0.0094399247  4.560014e-04
## 207  0.007155412  0.0027673214  4.913532e-04
## 208  0.156737716 -0.0029897026  3.695482e-04
## 209 -0.001195833  0.0094399247  4.560014e-04
## 210 -0.060159473 -0.0043214387  2.784826e-04
## 211 -0.001195833  0.0094399247  4.560014e-04
## 212 -0.020084580  0.0048781076  3.429694e-04
## 213 -0.001195833  0.0094399247  4.560014e-04
## 214 -0.154297490  0.0009152275 -9.823111e-05
## 215 -0.001195833  0.0094399247  4.560014e-04
## 216  0.029044455  0.0050494016  5.911406e-04
## 217 -0.001195833  0.0094399247  4.560014e-04
## 218  0.000919764  0.0033139959  4.138630e-04
## 219 -0.002080531  0.0055937328  4.271075e-04
## 220  0.007155412  0.0027673214  4.913532e-04
## 221 -0.037507370 -0.0056430312  2.628845e-04
## 222 -0.001195833  0.0094399247  4.560014e-04
## 223  0.038280398  0.0022229902  6.553863e-04
## 224 -0.002965229  0.0017475408  3.982137e-04
## 225 -0.001195833  0.0094399247  4.560014e-04
## 226 -0.001195833  0.0094399247  4.560014e-04
## 227 -0.001195833  0.0094399247  4.560014e-04
## 228  0.007155412  0.0027673214  4.913532e-04
## 229 -0.001195833  0.0094399247  4.560014e-04
## 230 -0.016503026 -0.0072071429  3.337781e-04
## 231  0.029044455  0.0050494016  5.911406e-04
## 232 -0.001195833  0.0094399247  4.560014e-04
## 233 -0.002080531  0.0055937328  4.271075e-04
## 234  0.026390359 -0.0064891743  5.044591e-04
## 235  0.012462101 -0.0023072450  2.888775e-04
## 236 -0.001195833  0.0094399247  4.560014e-04
## 237 -0.001195833  0.0094399247  4.560014e-04
## 238 -0.001195833  0.0094399247  4.560014e-04
## 239 -0.003849928 -0.0020986511  3.693198e-04
## 240 -0.001195833  0.0094399247  4.560014e-04
## 241 -0.002965229  0.0017475408  3.982137e-04
## 242  0.006398301  0.0100074915 -2.899282e-05
## 243  0.029044455  0.0050494016  5.911406e-04
## 244 -0.001195833  0.0094399247  4.560014e-04
## 245 -0.001195833  0.0094399247  4.560014e-04
## 246 -0.001195833  0.0094399247  4.560014e-04
## 247 -0.001195833  0.0094399247  4.560014e-04
## 248 -0.001195833  0.0094399247  4.560014e-04
## 249 -0.001195833  0.0094399247  4.560014e-04
## 250  0.035556335  0.0099508695  2.775515e-04
## 251  0.029044455  0.0050494016  5.911406e-04
## 252 -0.001195833  0.0094399247  4.560014e-04
## 253  0.006270714 -0.0010788706  4.624593e-04
## 254 -0.034853275  0.0058955447  3.495661e-04
## 255 -0.001195833  0.0094399247  4.560014e-04
## 256 -0.001195833  0.0094399247  4.560014e-04
## 257 -0.009200878  0.0022942154  3.207235e-04
## 258  0.028159756  0.0012032097  5.622467e-04
## 259  0.021924108  0.0017498842  4.847565e-04
## 260  0.029044455  0.0050494016  5.911406e-04
## 261 -0.001195833  0.0094399247  4.560014e-04
## 262  0.028159756  0.0012032097  5.622467e-04
## 263 -0.001195833  0.0094399247  4.560014e-04
## 264 -0.002705611  0.0047411921  3.302181e-04
## 265  0.029044455  0.0050494016  5.911406e-04
## 266 -0.010129627  0.0083432267  4.042653e-04
## 267  0.011637778  0.0031754423  3.597733e-04
## 268  0.059284742  0.0006588785  7.262798e-04
## 269  0.007155412  0.0027673214  4.913532e-04
## 270 -0.001195833  0.0094399247  4.560014e-04
## 271  0.027275058 -0.0026429823  5.333529e-04
## 272 -0.028149789 -0.0010195779  4.714096e-04
## 273 -0.002080531  0.0055937328  4.271075e-04
## 274 -0.001195833  0.0094399247  4.560014e-04
## 275 -0.002965229  0.0017475408  3.982137e-04
## 276  0.116249200 -0.0107053222  6.327216e-04
## 277 -0.004734626 -0.0059448431  3.404260e-04
## 278 -0.048851963 -0.0242698548  2.626283e-04
## 279 -0.002965229  0.0017475408  3.982137e-04
## 280 -0.001195833  0.0094399247  4.560014e-04
## 281 -0.002080531  0.0055937328  4.271075e-04
## 282 -0.001195833  0.0094399247  4.560014e-04
## 283 -0.009200878  0.0022942154  3.207235e-04
## 284 -0.001195833  0.0094399247  4.560014e-04
## 285  0.067635987 -0.0060137249  7.616317e-04
## 286 -0.001195833  0.0094399247  4.560014e-04
## 287 -0.001195833  0.0094399247  4.560014e-04
## 288 -0.001195833  0.0094399247  4.560014e-04
## 289  0.037523287  0.0094631604  1.350403e-04
## 290 -0.001195833  0.0094399247  4.560014e-04
## 291 -0.001195833  0.0094399247  4.560014e-04
## 292  0.151919558  0.1295650379 -2.593133e-02
## 293  0.092179124  0.0078069313  9.481006e-04
## 294 -0.001195833  0.0094399247  4.560014e-04
## 295  0.038540017  0.0052166415  5.873907e-04
## 296 -0.001195833  0.0094399247  4.560014e-04
## 297  0.028500540 -0.0012979868  3.816443e-04
## 298  0.033031373  0.0356928932 -1.379033e-03
## 299  0.027275058 -0.0026429823  5.333529e-04
## 300 -0.045120604 -0.0149082388  2.815814e-04
## 301  0.007155412  0.0027673214  4.913532e-04
## 302 -0.001195833  0.0094399247  4.560014e-04
## 303 -0.001195833  0.0094399247  4.560014e-04
## 304  0.027275058 -0.0026429823  5.333529e-04
## 305 -0.001195833  0.0094399247  4.560014e-04
## 306 -0.002080531  0.0055937328  4.271075e-04
## 307 -0.001195833  0.0094399247  4.560014e-04
## 308  0.004501317 -0.0087712545  4.046717e-04
## 309 -0.059396412 -0.0079251115  1.630971e-04
## 310 -0.048215768 -0.0341100808  3.757244e-04
## 311 -0.018272423 -0.0148995268  2.759904e-04
## 312 -0.001195833  0.0094399247  4.560014e-04
## 313 -0.004734626 -0.0059448431  3.404260e-04
## 314 -0.001195833  0.0094399247  4.560014e-04
## 315 -0.001195833  0.0094399247  4.560014e-04
## 316 -0.001195833  0.0094399247  4.560014e-04
## 317 -0.001195833  0.0094399247  4.560014e-04
## 318 -0.001195833  0.0094399247  4.560014e-04
## 319  0.060298428  0.0070517322  3.855609e-04
## 320  0.021924108  0.0017498842  4.847565e-04
## 321 -0.001195833  0.0094399247  4.560014e-04
## 322 -0.002080531  0.0055937328  4.271075e-04
## 323 -0.001195833  0.0094399247  4.560014e-04
## 324  0.029929153  0.0088955936  6.200344e-04
## 325 -0.002080531  0.0055937328  4.271075e-04
## 326 -0.001195833  0.0094399247  4.560014e-04
## 327 -0.001195833  0.0094399247  4.560014e-04
## 328 -0.001195833  0.0094399247  4.560014e-04
## 329 -0.001195833  0.0094399247  4.560014e-04
## 330 -0.001195833  0.0094399247  4.560014e-04
## 331  0.029044455  0.0050494016  5.911406e-04
## 332  0.163665038  0.0038918576  1.340412e-03
## 333 -0.001195833  0.0094399247  4.560014e-04
## 334 -0.001195833  0.0094399247  4.560014e-04
## 335 -0.001195833  0.0094399247  4.560014e-04
## 336 -0.001195833  0.0094399247  4.560014e-04
## 337 -0.001195833  0.0094399247  4.560014e-04
## 338 -0.001195833  0.0094399247  4.560014e-04
## 339 -0.001195833  0.0094399247  4.560014e-04
## 340 -0.001195833  0.0094399247  4.560014e-04
## 341  0.021924108  0.0017498842  4.847565e-04
## 342 -0.001195833  0.0094399247  4.560014e-04
## 343  0.033031373  0.0356928932 -1.379033e-03
## 344 -0.001195833  0.0094399247  4.560014e-04
## 345 -0.001195833  0.0094399247  4.560014e-04
## 346 -0.001195833  0.0094399247  4.560014e-04
## 347  0.021924108  0.0017498842  4.847565e-04
## 348 -0.001195833  0.0094399247  4.560014e-04
## 349 -0.001195833  0.0094399247  4.560014e-04
## 350  0.006398301  0.0100074915 -2.899282e-05
## 351 -0.002080531  0.0055937328  4.271075e-04
## 352 -0.001195833  0.0094399247  4.560014e-04
## 353 -0.001195833  0.0094399247  4.560014e-04
## 354 -0.001195833  0.0094399247  4.560014e-04
## 355 -0.001195833  0.0094399247  4.560014e-04
## 356 -0.001195833  0.0094399247  4.560014e-04
## 357 -0.001195833  0.0094399247  4.560014e-04
## 358 -0.002080531  0.0055937328  4.271075e-04
## 359 -0.001195833  0.0094399247  4.560014e-04
## 360 -0.001195833  0.0094399247  4.560014e-04
## 361 -0.001195833  0.0094399247  4.560014e-04
## 362 -0.001195833  0.0094399247  4.560014e-04
## 363 -0.002080531  0.0055937328  4.271075e-04
## 364 -0.002080531  0.0055937328  4.271075e-04
## 365 -0.002080531  0.0055937328  4.271075e-04
## 366 -0.002080531  0.0055937328  4.271075e-04
## 367 -0.002080531  0.0055937328  4.271075e-04
## 368 -0.001195833  0.0094399247  4.560014e-04
## 369 -0.001195833  0.0094399247  4.560014e-04
## 370 -0.001195833  0.0094399247  4.560014e-04
## 371 -0.001195833  0.0094399247  4.560014e-04
## 372 -0.002080531  0.0055937328  4.271075e-04
## 373 -0.002080531  0.0055937328  4.271075e-04
## 374 -0.001195833  0.0094399247  4.560014e-04
## 375 -0.001195833  0.0094399247  4.560014e-04
## 376 -0.001195833  0.0094399247  4.560014e-04
## 377 -0.001195833  0.0094399247  4.560014e-04
## 378 -0.001195833  0.0094399247  4.560014e-04
## 379 -0.001195833  0.0094399247  4.560014e-04
## 380 -0.001195833  0.0094399247  4.560014e-04
## 381 -0.001195833  0.0094399247  4.560014e-04
## 382 -0.002705611  0.0047411921  3.302181e-04
## 383 -0.002080531  0.0055937328  4.271075e-04
## 384 -0.009200878  0.0022942154  3.207235e-04
## 385 -0.001195833  0.0094399247  4.560014e-04
## 386 -0.001195833  0.0094399247  4.560014e-04
## 387  0.078466084  0.0711383522 -7.854563e-03
## 388  0.033031373  0.0356928932 -1.379033e-03
## 389  0.008040111  0.0066135133  5.202470e-04
## 390 -0.001195833  0.0094399247  4.560014e-04
## 391 -0.002080531  0.0055937328  4.271075e-04
## 392 -0.002080531  0.0055937328  4.271075e-04
## 393 -0.001195833  0.0094399247  4.560014e-04
## 394 -0.001195833  0.0094399247  4.560014e-04
## 395 -0.002080531  0.0055937328  4.271075e-04
## 396 -0.001195833  0.0094399247  4.560014e-04
## 397 -0.001195833  0.0094399247  4.560014e-04
## 398 -0.001195833  0.0094399247  4.560014e-04
## 399  0.029044455  0.0050494016  5.911406e-04
## 400 -0.001195833  0.0094399247  4.560014e-04
## 401 -0.001195833  0.0094399247  4.560014e-04
## 402 -0.002080531  0.0055937328  4.271075e-04
## 403 -0.001195833  0.0094399247  4.560014e-04
## 404 -0.001195833  0.0094399247  4.560014e-04
## 405 -0.002080531  0.0055937328  4.271075e-04
## 406 -0.002080531  0.0055937328  4.271075e-04
## 407 -0.001195833  0.0094399247  4.560014e-04
## 408 -0.001195833  0.0094399247  4.560014e-04
## 409 -0.001195833  0.0094399247  4.560014e-04
## 410 -0.009200878  0.0022942154  3.207235e-04
## 411 -0.009200878  0.0022942154  3.207235e-04
## 412 -0.002080531  0.0055937328  4.271075e-04
## 413 -0.009200878  0.0022942154  3.207235e-04
## 414 -0.001195833  0.0094399247  4.560014e-04
## 415 -0.001195833  0.0094399247  4.560014e-04
## 416  0.104480799 -0.0119676219  6.260737e-04
## 417  0.029044455  0.0050494016  5.911406e-04
## 418 -0.001195833  0.0094399247  4.560014e-04
## 419 -0.001195833  0.0094399247  4.560014e-04
## 420 -0.001195833  0.0094399247  4.560014e-04
## 421 -0.001195833  0.0094399247  4.560014e-04
## 422  0.029044455  0.0050494016  5.911406e-04
## 423  0.029044455  0.0050494016  5.911406e-04
## 424 -0.002080531  0.0055937328  4.271075e-04
## 425 -0.001195833  0.0094399247  4.560014e-04
## 426 -0.001195833  0.0094399247  4.560014e-04
## 427 -0.002965229  0.0017475408  3.982137e-04
## 428 -0.001195833  0.0094399247  4.560014e-04
## 429 -0.009200878  0.0022942154  3.207235e-04
## 430 -0.001195833  0.0094399247  4.560014e-04
## 431 -0.002080531  0.0055937328  4.271075e-04
## 432 -0.001195833  0.0094399247  4.560014e-04
## 433 -0.001195833  0.0094399247  4.560014e-04
## 434 -0.001195833  0.0094399247  4.560014e-04
## 435 -0.001195833  0.0094399247  4.560014e-04
## 436  0.029044455  0.0050494016  5.911406e-04
## 437 -0.001195833  0.0094399247  4.560014e-04
## 438 -0.001195833  0.0094399247  4.560014e-04
## 439 -0.001195833  0.0094399247  4.560014e-04
## 440  0.016745051  0.0159533320 -1.258509e-03
## 441 -0.001195833  0.0094399247  4.560014e-04
## 442  0.060169440  0.0045050705  7.551737e-04
## 443  0.033031373  0.0356928932 -1.379033e-03
## 444 -0.001195833  0.0094399247  4.560014e-04
## 445  0.523583558  0.2376829480 -3.461505e-03
## 446 -0.497249235 -0.0532818701 -2.074653e-03
## 447 -0.754609550 -0.0575896818 -3.098739e-03
## 448  0.266201189 -0.0622949985  2.810815e-04
## 449  0.347471761 -0.1434815253  8.729611e-04
## 450  0.184557738  0.0296599484 -1.903251e-03
## 451 -0.190161446  0.3641369228 -6.380613e-03
## 452 -0.123620011 -0.0206891308 -7.112771e-04
## 453 -0.346836215  0.3300922022 -6.146580e-03
## 454 -0.391515989  0.0033631068 -2.018654e-03
## 455 -0.491044231 -0.0082986035 -2.114071e-03
## 456  1.718523550 -0.0511505160  8.476185e-03
## 457 -0.632296386 -0.0355360444 -2.758369e-03
## 458 -0.837297704  0.0105657940 -3.720689e-03
## 459  0.022416932 -0.1085158601 -4.836760e-04
## 460 -0.559046000 -0.0244166353 -2.162588e-03
## 461 -0.653896298 -0.0081867663 -2.278858e-03
## 462 -0.656359686  0.0138133933 -2.939007e-03
## 463  0.131913914 -0.0560522566 -2.503327e-04
## 464  0.294300634 -0.1003760129  3.047519e-04
## 465  0.275694705 -0.0722483151  1.977782e-04
## 466  0.350400628 -0.0322150718 -1.490605e-04
## 467  0.596204753  0.3991150547 -5.757459e-03
## 468  0.271690155 -0.0494642775 -1.406978e-03
## 469 -0.519671552 -0.0345270974 -1.845765e-03
## 470 -0.167589671 -0.0946294467 -4.463072e-04
## 471 -0.051017215 -0.0425990750 -7.279937e-04
## 472 -0.364223953 -0.0286066881 -1.949757e-03
## 473 -0.836080978 -0.0497779747 -3.364641e-03
## 474 -0.181269691 -0.0432226842 -9.704938e-04
## 475 -0.233315868 -0.0899248499 -1.771772e-03
## 476 -0.256717716 -0.0038905258 -4.112289e-04
## 477 -0.351093633 -0.1076935880 -1.492242e-03
## 478 -0.168353773 -0.0469452100 -1.266438e-03
## 479 -0.342547089 -0.0039166140 -1.832111e-03
## 480 -0.624693271 -0.0267065390 -2.200233e-03
## 481 -0.447568807  0.0039039444 -2.186579e-03
## 482 -0.521469486 -0.0164995540 -2.772671e-03
## 483 -0.033297213 -0.0573364902 -4.341054e-04
## 484  0.178272346 -0.0801849525  4.405922e-05
## 485 -0.184499566  0.0117628284 -9.401118e-04
## 486 -0.583989073  0.0137445116 -2.517801e-03
## 487 -0.545403343 -0.0247136616 -2.585005e-03
## 488  0.809009165  0.0427565744  6.046802e-04
## 489  0.367879389 -0.1056642692  2.658960e-04
## 490 -0.934482534  0.0554168361 -4.635016e-03
## 491  0.351574730 -0.1242588722  4.557376e-04
## 492 -0.392499303 -0.0087474750 -2.463000e-03
## 493 -0.190618680 -0.0404925419 -1.033658e-03
## 494 -0.276418690 -0.0320485351 -1.304862e-03
## 495  0.122843746 -0.0861972326 -3.205838e-04
## 496 -0.330983881 -0.0734871475 -1.565292e-03
## 497 -0.394408550 -0.0403080948 -1.305019e-03
## 498 -0.047875514 -0.0501414436 -6.282235e-04
## 499 -0.172262054 -0.0671004613 -5.522891e-04
## 500 -0.409796695  0.0003863903 -1.213723e-03
## 501 -1.023547457  0.0060128763 -3.666051e-03
## 502 -0.174600063 -0.0862657399 -1.661681e-03
## 503 -0.813138195  0.3562872903  6.510375e-02
## 504  0.659821155 -0.0416891855 -2.572469e-03
## 505  0.121628890  0.3715153511 -6.989459e-03
## 506  0.545714100 -0.1897572368 -6.576587e-04
## 507  0.764928312 -0.1639163251  1.146800e-03
## 508  0.274987975 -0.1857004180 -7.515425e-05
## 509  1.062710848  0.1581259446 -3.536337e-03
## 510  0.937567760  0.0774854323 -3.486155e-03
## 511 -0.436221539  0.2106644514 -8.907283e-03
## 512  0.717374081  0.1558424370 -5.477979e-03
## 513 -0.010545411  0.0314829778 -4.465146e-04
## 514 -0.025322045 -0.0033065491 -2.168011e-03
## 515  0.198438410  0.1521511761 -3.471927e-03
## 516 -0.029819286 -0.0122167983 -2.921271e-05
## 517  0.392563612  0.1040706497 -2.312698e-03
## 518  0.075981461  0.0228360711 -2.360800e-04
## 519 -0.029819286 -0.0122167983 -2.921271e-05
## 520  0.035721489  0.0240896662 -2.331707e-03
## 521 -0.025322045 -0.0033065491 -2.168011e-03
## 522 -0.020620101 -0.0019906260 -1.060281e-03
## 523 -0.055240594 -0.0312470955 -1.840283e-03
## 524 -0.029819286 -0.0122167983 -2.921271e-05
## 525 -0.055240594 -0.0312470955 -1.840283e-03
## 526 -0.035654025 -0.0038182748 -1.193390e-02
## 527 -0.100746304 -0.0649303134 -7.672183e-03
## 528  0.184312188  0.0129671003  2.067384e-05
## 529 -0.025322045 -0.0033065491 -2.168011e-03
## 530 -0.029819286 -0.0122167983 -2.921271e-05
## 531 -0.024115609 -0.0317914267 -1.676250e-03
## 532 -0.029819286 -0.0122167983 -2.921271e-05
## 533 -0.078660562 -0.0486358765 -4.480013e-03
## 534 -0.029819286 -0.0122167983 -2.921271e-05
## 535 -0.029819286 -0.0122167983 -2.921271e-05
## 536 -0.029819286 -0.0122167983 -2.921271e-05
## 537  0.391422968  0.1822254811 -4.901744e-03
## 538 -0.029819286 -0.0122167983 -2.921271e-05
## 539 -0.024115609 -0.0317914267 -1.676250e-03
## 540  0.015822625 -0.0007139522 -4.349079e-05
## 541 -0.029819286 -0.0122167983 -2.921271e-05
## 542 -0.024115609 -0.0317914267 -1.676250e-03
## 543 -0.038496333 -0.0660189757 -7.344117e-03
## 544  0.093707976  0.0435865263 -4.804574e-03
## 545 -0.055240594 -0.0312470955 -1.840283e-03
## 546  0.031852640  0.0153549838 -8.088004e-04
## 547 -0.055240594 -0.0312470955 -1.840283e-03
## 548 -0.029819286 -0.0122167983 -2.921271e-05
## 549 -0.078660562 -0.0486358765 -4.480013e-03
## 550 -0.043557183  0.0186094522 -4.122367e-04
## 551  0.259426795  0.0282811463 -4.072608e-04
## 552  0.145447964  0.1324875221 -2.651789e-03
## 553 -0.015302360 -0.0001696211 -2.075239e-04
## 554 -0.029819286 -0.0122167983 -2.921271e-05
## 555  0.001305700 -0.0127611295  1.348204e-04
## 556 -0.078660562 -0.0486358765 -4.480013e-03
## 557 -0.029819286 -0.0122167983 -2.921271e-05
## 558 -0.029819286 -0.0122167983 -2.921271e-05
## 559  0.211393196  0.0792292931 -3.322646e-03
## 560 -0.069780920  0.0844403015 -2.901433e-03
## 561 -0.029819286 -0.0122167983 -2.921271e-05
## 562 -0.055240594 -0.0312470955 -1.840283e-03
## 563 -0.029819286 -0.0122167983 -2.921271e-05
## 564 -0.055240594 -0.0312470955 -1.840283e-03
## 565  0.160081238 -0.0119284786 -3.823219e-04
## 566 -0.029819286 -0.0122167983 -2.921271e-05
## 567 -0.029819286 -0.0122167983 -2.921271e-05
## 568 -0.029819286 -0.0122167983 -2.921271e-05
## 569 -0.078660562 -0.0486358765 -4.480013e-03
## 570 -0.005181719  0.0008501594 -1.143843e-04
## 571 -0.029819286 -0.0122167983 -2.921271e-05
## 572  0.019091315  0.0181389127 -8.631964e-05
## 573  0.010504884 -0.0025349572 -8.962484e-04
## 574 -0.015302360 -0.0001696211 -2.075239e-04
## 575 -0.142321099 -0.1282844208  4.663303e-02
## 576  0.135037054 -0.0131668152  1.910171e-04
## 577  0.160873657  0.0446937648 -1.231761e-03
## 578 -0.090625662 -0.0639105329 -7.579044e-03
## 579 -0.015302360 -0.0001696211 -2.075239e-04
## 580  0.135037054 -0.0131668152  1.910171e-04
## 581 -0.055240594 -0.0312470955 -1.840283e-03
## 582 -0.015302360 -0.0001696211 -2.075239e-04
## 583 -0.001548495  0.0154812289 -2.704495e-04
## 584  0.021052486  0.1101491025 -2.967105e-03
## 585  0.019091315  0.0181389127 -8.631964e-05
## 586 -0.029819286 -0.0122167983 -2.921271e-05
## 587 -0.005181719  0.0008501594 -1.143843e-04
## 588  0.019465302  0.0351096756 -4.289586e-03
## 589 -0.029819286 -0.0122167983 -2.921271e-05
## 590 -0.029819286 -0.0122167983 -2.921271e-05
## 591 -0.029819286 -0.0122167983 -2.921271e-05
## 592 -0.029819286 -0.0122167983 -2.921271e-05
## 593 -0.029819286 -0.0122167983 -2.921271e-05
## 594 -0.078660562 -0.0486358765 -4.480013e-03
## 595 -0.029819286 -0.0122167983 -2.921271e-05
## 596  0.002047969  0.0431648821 -1.521829e-03
## 597  0.033660664  0.0196186503 -1.517917e-03
## 598 -0.055240594 -0.0312470955 -1.840283e-03
## 599 -0.078660562 -0.0486358765 -4.480013e-03
## 600  0.010504884 -0.0025349572 -8.962484e-04
## 601 -0.055240594 -0.0312470955 -1.840283e-03
## 602 -0.005181719  0.0008501594 -1.143843e-04
## 603 -0.078660562 -0.0486358765 -4.480013e-03
## 604 -0.055240594 -0.0312470955 -1.840283e-03
## 605 -0.029819286 -0.0122167983 -2.921271e-05
## 606 -0.015302360 -0.0001696211 -2.075239e-04
## 607 -0.029819286 -0.0122167983 -2.921271e-05
## 608 -0.078660562 -0.0486358765 -4.480013e-03
## 609 -0.029819286 -0.0122167983 -2.921271e-05
## 610 -0.029819286 -0.0122167983 -2.921271e-05
## 611 -0.029819286 -0.0122167983 -2.921271e-05
## 612 -0.052135737  0.0568594268 -1.182097e-03
## 613  0.087710626 -0.0118595968 -8.035276e-04
## 614 -0.055240594 -0.0312470955 -1.840283e-03
## 615 -0.029819286 -0.0122167983 -2.921271e-05
## 616 -0.055240594 -0.0312470955 -1.840283e-03
## 617 -0.029819286 -0.0122167983 -2.921271e-05
## 618  0.140183367  0.0054860130 -5.520465e-04
## 619 -0.005181719  0.0008501594 -1.143843e-04
## 620 -0.029819286 -0.0122167983 -2.921271e-05
## 621  0.001305700 -0.0127611295  1.348204e-04
## 622 -0.029819286 -0.0122167983 -2.921271e-05
## 623  0.008970674  0.0171191321 -1.794592e-04
## 624  0.149553980 -0.0011196380  1.270596e-05
## 625 -0.029819286 -0.0122167983 -2.921271e-05
## 626 -0.029819286 -0.0122167983 -2.921271e-05
## 627 -0.026186062  0.0024142711 -1.852779e-04
## 628 -0.029819286 -0.0122167983 -2.921271e-05
## 629 -0.029819286 -0.0122167983 -2.921271e-05
## 630 -0.029819286 -0.0122167983 -2.921271e-05
## 631 -0.015302360 -0.0001696211 -2.075239e-04
## 632 -0.029819286 -0.0122167983 -2.921271e-05
## 633 -0.029819286 -0.0122167983 -2.921271e-05
## 634 -0.029819286 -0.0122167983 -2.921271e-05
## 635 -0.015302360 -0.0001696211 -2.075239e-04
## 636 -0.029819286 -0.0122167983 -2.921271e-05
## 637 -0.029819286 -0.0122167983 -2.921271e-05
## 638  0.183433260 -0.0264014910  1.024844e-03
## 639  0.066657686 -0.0418089872  5.760251e-04
## 640  0.034222591 -0.0454728677  3.904725e-04
## 641  0.130688312 -0.0164360974  2.580062e-04
## 642  0.069044535 -0.0362587346 -1.507797e-05
## 643  0.204970879 -0.0490024557  7.670623e-04
## 644  0.202880271 -0.0281934634  8.113044e-04
## 645  0.140630300 -0.0271048011  4.832383e-04
## 646  0.140296598 -0.0420191890  5.656039e-04
## 647  0.140296598 -0.0420191890  5.656039e-04
## 648  0.095755454 -0.0429796769  4.814146e-04
## 649  0.357229760  0.0722242077 -9.455198e-04
## 650  0.082145065 -0.0866147194  6.863091e-04
## 651  0.042633279 -0.0547007415  1.485841e-04
## 652  0.142322188 -0.0037530958  1.215933e-04
## 653  0.036248215 -0.0145492887 -1.508296e-04
## 654 -0.028528395  0.0229819446 -2.199536e-04
## 655  0.250177956  0.1216165649 -2.174474e-03
## 656 -0.003958075 -0.0120819667  3.003099e-04
## 657  0.648890069 -0.0173757972  3.785121e-03
## 658  0.524390127 -0.0151984726  3.128988e-03
## 659 -0.177301015 -0.0226462250 -4.402016e-04
## 660  0.142948046 -0.0043814835  3.630206e-05
## 661  0.251018556 -0.0268413532  1.701225e-04
## 662  0.004565907 -0.0082308465  1.454655e-04
## 663 -0.378241269 -0.0014999175 -1.237128e-03
## 664 -0.038621854 -0.0269224034  2.070142e-05
## 665 -0.093938553 -0.0153156835  2.776802e-05
## 666 -0.009305304  0.0028605394  3.333695e-04
## 667 -0.071164813 -0.0091874112  1.564493e-04
## 668 -0.221090221 -0.0114289187 -6.477340e-04
## 669  0.094749117 -0.0542757335  3.082414e-04
## 670  0.201230723 -0.0126474911  8.778607e-04
## 671 -0.313236151  0.0047825637 -9.314168e-04
## 672  0.112710406 -0.0260900900  5.171462e-04
## 673 -0.063658994  0.0023036899  2.283267e-04
## 674  0.079937662 -0.0257882781  4.396048e-04
## 675  0.117195730  0.0462773972 -5.129342e-04
## 676 -0.633456153  0.0084527821 -1.762631e-03
## 677 -0.311131888  0.0223012704 -1.353580e-03
## 678 -0.431133659  0.0042121981 -1.356670e-03
## 679 -0.133401293 -0.0106321997 -9.634751e-05
## 680 -0.058652863 -0.0057089497 -4.121579e-04
## 681 -0.198305359 -0.0210821133 -5.110952e-04
## 682  0.173190981 -0.0348711363  7.874247e-04
## 683  0.015933643 -0.0354113576  3.607136e-04
## 684 -0.081926877  0.0008463457  3.229746e-04
## 685  0.106725882  0.0054145796  4.885046e-04
## 686  0.087404209 -0.0363070735  4.460627e-04
## 687  0.101826704 -0.0235061978  5.393922e-04
## 688 -0.354615124 -0.0161367435 -1.440338e-03
## 689  0.141629308 -0.0181742257  1.265780e-03
## 690  0.112710406 -0.0260900900  5.171462e-04
## 691 -0.035516798 -0.0176070592 -1.913265e-04
## 692  0.062689626  0.0616502669 -7.539292e-04
## 693  0.118407556 -0.0443012693  4.658165e-04
## 694  0.247742627 -0.0557343518  7.934639e-04
## 695 -0.052398552  0.0031333542  2.390238e-04
## 696 -0.127825781 -0.0362932437 -2.919565e-04
## 697  0.105632819 -0.0568596257  2.859954e-04
## 698 -0.100983930  0.0137681303 -3.095696e-04
## 699  0.012501139 -0.0403269029  8.245487e-05
## 700 -0.072934210 -0.0168797951  9.866157e-05
## 701  0.089918449 -0.0305876433  2.024613e-04
## 702  0.219509790 -0.0161854694  1.836288e-04
## 703 -0.050160469 -0.0107515229  2.273428e-04
## 704 -0.056059368 -0.0344727295  5.294991e-05
## 705 -0.246263659 -0.0299775043 -5.665806e-04
## 706  0.019564296  0.0211389578  1.520463e-05
## 707 -0.240102478  0.0011100092 -6.255966e-04
## 708 -0.069503564 -0.0114783428  1.452270e-04
## 709 -0.121632893 -0.0093699000 -8.969963e-05
## 710  0.032381884 -0.0067267653  4.072125e-04
## 711 -0.118907280  0.0463770634 -9.064601e-04
## 712 -0.059653381  0.0235262757 -3.839867e-04
## 713  0.099788484 -0.0106121041  4.747379e-04
## 714  0.419877137 -0.0761575291  1.936606e-03
## 715 -0.482369162  0.0259649077 -1.579044e-03
## 716 -0.389124971  0.0010839747 -1.214882e-03
## 717 -0.443653998 -0.0092278958 -1.239974e-03
## 718 -0.154405637 -0.0090680881 -1.672411e-04
## 719  0.027960046  0.0641375299 -1.038172e-03
## 720 -0.135402242  0.0090922425 -1.263424e-04
## 721  0.253708886 -0.0302488648  1.129668e-03
## 722  0.204572159 -0.0048417581  4.496595e-04
## 723 -0.029865539  0.0067747903 -1.392422e-04
## 724  0.089135016 -0.0860585027  2.855456e-04
## 725  0.107402216 -0.0491672418  3.437831e-04
## 726 -0.251852662 -0.0017830095 -4.462409e-04
## 727  0.120857648 -0.0256525264  3.293588e-04
## 728  0.175845076 -0.0233325604  8.741062e-04
## 729  0.052326420 -0.0221933174  5.605812e-04
## 730  0.140434408 -0.0292667163  1.399888e-04
## 731  0.141269934 -0.0223698470  2.036381e-04
## 732 -0.155411973 -0.0203641447 -3.404142e-04
## 733 -0.248455017  0.0119717281 -9.348144e-04
## 734 -0.264577748 -0.0083993700 -7.047192e-04
## 735  0.102119073 -0.0461947642 -1.052945e-05
## 736 -0.031213398 -0.0490291182  1.309698e-04
## 737 -0.145061546 -0.0019111840 -3.398544e-05
## 738  0.174105341 -0.0282557871  3.216935e-04
## 739 -0.141485217 -0.0526977921 -5.006715e-04
## 740 -0.505717599  0.0004641234 -1.723494e-03
## 741  0.233518709 -0.0746140480  2.534752e-04
## 742  0.117522858 -0.0481474613  4.369226e-04
## 743 -0.033698023 -0.0207379340  2.708215e-04
## 744 -0.070176198 -0.0078600116 -1.103118e-04
## 745 -0.009266265 -0.0351591185  1.269468e-04
## 746  0.142609588 -0.0015778168  6.534241e-05
## 747  0.118627916 -0.0399224377  2.021771e-04
## 748 -0.003198459  0.0358266653 -2.361991e-04
## 749 -0.271227464  0.0016543404 -7.896297e-04
## 750 -0.054705225  0.0372818773 -8.997823e-04
## 751 -0.056746548 -0.0088886434 -1.148862e-04
## 752 -0.171663502 -0.0092421697 -7.098274e-04
## 753 -0.019675095 -0.0509964462  4.308108e-04
## 754  0.110056311 -0.0376286659  4.304647e-04
## 755  0.025924918 -0.0022105607 -3.182711e-05
## 756  0.140951511 -0.0556061773  3.812085e-04
## 757  0.142670962  0.0131001111 -7.303306e-05
## 758  0.155012734  0.0024834311 -1.709676e-04
## 759  0.088583282 -0.0144872933  4.290398e-04
## 760  0.086484599  0.0033750186  3.022255e-04
## 761 -0.010266313  0.0093881132  4.839102e-04
## 762  0.193728551 -0.0129248693  8.866068e-04
## 763 -0.008381567 -0.0313129265  1.558406e-04
## 764 -0.017495872 -0.0210366504  2.358743e-04
## 765  0.047164918 -0.0254864662  3.620633e-04
## 766  0.036077212 -0.0157924069  1.611700e-04
## 767  0.011828375 -0.0197575933 -1.174555e-04
## 768  0.111062648 -0.0263326093  6.036378e-04
## 769  0.056612925 -0.0208483544  1.996641e-04
## 770  0.287617420 -0.0067538712  5.393624e-04
## 771  0.150976348 -0.0332393247  4.290439e-04
## 772 -0.156951585 -0.0106233484 -1.849126e-04
## 773 -0.006082853  0.0049277913 -4.824134e-05
## 774 -0.134286997  0.0004142514 -7.866861e-04
## 775  0.151093490 -0.0072378596  7.805603e-04
## 776 -0.061807232 -0.0045639579  3.649743e-04
## 777 -0.020329696 -0.0516130104  1.087239e-04
## 778  0.025275876 -0.0277685465  2.622759e-04
## 779 -0.089137515  0.0269593075 -6.403410e-04
## 780 -0.057319885  0.0289355661 -5.337467e-04
## 781 -0.003958075 -0.0120819667  3.003099e-04
## 782  0.109146065 -0.0059886508  6.832629e-04
## 783  0.197927694 -0.0246538224  6.040017e-04
## 784  0.056537044 -0.0428287678  4.828856e-04
##                                                                                                     category
## 1                                                                                                Album Notes
## 2                          Album Of Best Original Score Written For A Motion Picture Or A Television Special
## 3                                                                   Album Of The Year (Other Than Classical)
## 4                                                                             Album Of The Year -- Classical
## 5                                                                                    Alternative Music Album
## 6                                                                                            Americana Album
## 7                                                                                                Banda Album
## 8                                                                                     Banda Or Norteño Album
## 9                                                                             Best African Music Performance
## 10                                                                   Best Album Cover (Other Than Classical)
## 11                                                                                   Best Album For Children
## 12           Best Album Of Original Instrumental Background Score Written For A Motion Picture Or Television
## 13           Best Album Or Original Instrumental Background Score Written For A Motion Picture Or Television
## 14                                                                               Best Alternative Jazz Album
## 15                                                                                Best Americana Performance
## 16                                           Best Arrangement Accompanying Vocalist(S) Or Instrumentalist(S)
## 17                                                                               Best Arrangement For Voices
## 18                                                        Best Arrangement For Voices (Duo, Group Or Chorus)
## 19                                                             Best Arrangement On An Instrumental Recording
## 20                                                    Best Audio Book, Narration, And Storytelling Recording
## 21                                                                                          Best Banda Album
## 22                                                                                  Best Bluegrass Recording
## 23                                                          Best Bluegrass Recording (Vocal Or Instrumental)
## 24                                                                                          Best Blues Album
## 25                                                                              Best Boxed Recording Package
## 26                                                                                  Best Broadway Show Album
## 27                                                    Best Chamber Music Or Other Small Ensemble Performance
## 28                                                                                     Best Children'S Album
## 29                                                                               Best Children'S Music Album
## 30                                                                        Best Choral Performance, Classical
## 31                                                                       Best Classical Engineered Recording
## 32                                                                Best Classical Performance - Chamber Music
## 33                                  Best Classical Performance - Chamber Music (Including Chamber Orchestra)
## 34        Best Classical Performance - Concerto Or Instrumental Soloist (With Full Orchestral Accompaniment)
## 35                                             Best Classical Performance - Instrumental Solo With Orchestra
## 36                                          Best Classical Performance - Instrumental Solo Without Orchestra
## 37                                        Best Classical Performance - Instrumental Soloist (With Orchestra)
## 38                                  Best Classical Performance - Instrumental Soloist(S) (Without Orchestra)
## 39                    Best Classical Performance - Instrumentalist (Other Than Concerto-Scale Accompaniment)
## 40                                                         Best Classical Performance - Opera Cast Or Choral
## 41                                    Best Classical Performance - Vocal Soloist (With Or Without Orchestra)
## 42                                            Best Classical Performance Instrumental Solo Without Orchestra
## 43                                         Best Classical Performance, Instrumental Soloist (With Orchestra)
## 44                                      Best Classical Performance, Instrumental Soloist (Without Orchestra)
## 45                                       Best Classical Performance-Instrumental Soloist (Without Orchestra)
## 46                                       Best Classical Performance-Instrumental Soloist(S) (With Orchestra)
## 47                                                                           Best Classical Solo Vocal Album
## 48                                                                                 Best Classical Vocal Solo
## 49                                                                              Best Classical Vocal Soloist
## 50                                      Best Classical Vocal Soloist Performance (With Or Without Orchestra)
## 51                                                                         Best Comedy Performance - Musical
## 52                                                                     Best Comedy Performance - Spoken Word
## 53                                                               Best Composition By A Contemporary Composer
## 54                                                                                  Best Concept Music Video
## 55                                          Best Contemporary (R&R) Group Performance, Vocal Or Instrumental
## 56                                       Best Contemporary (R&R) Performance - Group (Vocal Or Instrumental)
## 57                                                                            Best Contemporary (R&R) Single
## 58                                           Best Contemporary (R&R) Solo Vocal Performance - Male Or Female
## 59                                                          Best Contemporary (R&R) Vocal Performance - Male
## 60                                                         Best Contemporary (R&R) Vocal Performance, Female
## 61                                                                                   Best Contemporary Album
## 62                                                                         Best Contemporary Blues Recording
## 63                                                                    Best Contemporary Christian Music Song
## 64                                                           Best Contemporary Female Solo Vocal Performance
## 65                                                                          Best Contemporary Folk Recording
## 66                                                                    Best Contemporary Folk/Americana Album
## 67                                                                Best Contemporary Instrumental Performance
## 68                                                         Best Contemporary Jazz Performance (Instrumental)
## 69                                                             Best Contemporary Male Solo Vocal Performance
## 70                                                                 Best Contemporary Performance By A Chorus
## 71                                                                        Best Contemporary R&B Gospel Album
## 72                                                                                  Best Contemporary Single
## 73                                                                                    Best Contemporary Song
## 74                                             Best Contemporary Vocal Performance By A Duo, Group Or Chorus
## 75                                                            Best Contemporary Vocal Performance By A Group
## 76                                                               Best Contemporary Vocal Performance, Female
## 77                                                                 Best Contemporary Vocal Performance, Male
## 78                                                                       Best Contemporary World Music Album
## 79                                                                 Best Contemporary-Pop Performance, Chorus
## 80                                                           Best Contemporary-Pop Performance, Instrumental
## 81                                                           Best Contemporary-Pop Vocal Performance, Female
## 82                                                             Best Contemporary-Pop Vocal Performance, Male
## 83                                                                              Best Country & Western Album
## 84                                                                        Best Country & Western Performance
## 85                                                                          Best Country & Western Recording
## 86                                                                             Best Country & Western Single
## 87                                                     Best Country & Western Solo Vocal Performance, Female
## 88                                                       Best Country & Western Solo Vocal Performance, Male
## 89                                                                               Best Country & Western Song
## 90                                                         Best Country & Western Vocal Performance - Female
## 91                                                            Best Country & Western Vocal Performance, Male
## 92                                       Best Country Instrumental Performance (Orchestra, Group Of Soloist)
## 93                                       Best Country Instrumental Performance (Orchestra, Group Or Soloist)
## 94                                      Best Country Instrumental Performance, (Orchestra, Group Or Soloist)
## 95                                                    Best Country Performance By A Duo Or Group With Vocals
## 96                                                                     Best Country Performance Duo Or Group
## 97                                            Best Country Performance, Duo Or Group - Vocal Or Instrumental
## 98                                                                   Best Country Vocal Performance - Female
## 99                                                                      Best Country Vocal Performance, Duet
## 100                                                                Best Country Vocal Solo Performance, Male
## 101                                                                                 Best Dance Pop Recording
## 102                                                                        Best Dance/Electronic Music Album
## 103                                                                             Best Dance/Electronica Album
## 104                                                                                     Best Disco Recording
## 105                                                                              Best Electronic/Dance Album
## 106                                                                    Best Engineered Album - Non-Classical
## 107                                                                   Best Engineered Album, - Non-Classical
## 108                                                                       Best Engineered Record (Classical)
## 109                                                                   Best Engineered Record - Non-Classical
## 110                                                                Best Engineered Recording (Non-Classical)
## 111                                                                Best Engineered Recording - Non Classical
## 112                                                      Best Engineering Contribution - Classical Recording
## 113                                                                  Best Engineering Contribution - Novelty
## 114                                          Best Engineering Contribution - Other Than Classical Or Novelty
## 115                                                                Best Ethnic Or Traditional Folk Recording
## 116                                       Best Ethnic Or Traditional Recording (Including Traditional Blues)
## 117                                                                        Best Ethnic Traditional Recording
## 118                                                                         Best Female Rap Solo Performance
## 119                                                                                  Best Global Music Album
## 120                                                                   Best Gospel Album By A Choir Or Chorus
## 121                                                                           Best Gospel Performance - Male
## 122                                                                Best Gospel Performance By A Duo Or Group
## 123                                               Best Gospel Performance By A Duo Or Group, Choir Or Chorus
## 124                                                    Best Gospel Performance Contemporary Or Inspirational
## 125                                                                    Best Gospel Performance, Contemporary
## 126                                                   Best Gospel Performance, Contemporary Or Inspirational
## 127                                                                          Best Gospel Performance, Female
## 128                                                                            Best Gospel Performance, Male
## 129                                           Best Gospel Vocal Performance By A Duo, Group, Choir Or Chorus
## 130                                                     Best Gospel/Contemporary Christian Music Performance
## 131                                                                    Best Hard Rock Performance With Vocal
## 132                                                   Best Hard Rock/Metal Performance Vocal Or Instrumental
## 133                                                                           Best Historical Reissue Record
## 134                                                                          Best Historical Repackage Album
## 135                                                           Best Inspirational Performance (Non-Classical)
## 136                                                 Best Instrumental Arrangement Accompanying A Vocalist(S)
## 137                                                        Best Instrumental Arrangement Accompanying Vocals
## 138                                                 Best Instrumental Arrangement With Accompanying Vocal(S)
## 139                                                          Best Instrumental Composition (Other Than Jazz)
## 140            Best Instrumental Composition Written For A Motion Picture, Television Or Other Visual Media.
## 141                                                               Best Instrumental Jazz Performance (Group)
## 142                                                                            Best Instrumental Performance
## 143                                                          Best Instrumental Performance (Other Than Jazz)
## 144                                                                 Best Instrumental Performance - Non-Jazz
## 145                                                                  Best Instrumental Performance, Non-Jazz
## 146                                                   Best Instrumental Soloist Performance (With Orchestra)
## 147                                                                                  Best Instrumental Theme
## 148                                                  Best Instrumental Theme Or Instrumental Version Of Song
## 149                                                                             Best Jazz Fusion Performance
## 150                                         Best Jazz Instrumental Performance Soloist (On A Jazz Recording)
## 151                                                                 Best Jazz Instrumental Performance, Solo
## 152                                        Best Jazz Instrumental Performance, Soloist (On A Jazz Recording)
## 153                                                                                    Best Jazz Performance
## 154                                                                            Best Jazz Performance - Group
## 155                                                                      Best Jazz Performance By A Big Band
## 156                                                                       Best Jazz Performance By A Soloist
## 157                                                                        Best Jazz Performance Large Group
## 158                                                                             Best Jazz Performance, Group
## 159                                                                        Best Jazz Performance, Individual
## 160                                                                                          Best Jazz Vocal
## 161                                                                       Best Jazz Vocal Performance - Male
## 162                                                                 Best Jazz Vocal Performance Duo Or Group
## 163                                                                Best Jazz Vocal Performance, Duo Or Group
## 164                                                                              Best Latin Jazz Performance
## 165                                                                            Best Latin Pop Or Urban Album
## 166                                                              Best Latin Rock, Alternative Or Urban Album
## 167                                                              Best Latin Rock, Urban Or Alternative Album
## 168                                                                        Best Latin Rock/Alternative Album
## 169                                                                  Best Latin Rock/Alternative Performance
## 170                                                                                   Best Latin Urban Album
## 171                                                                           Best Male Rap Solo Performance
## 172                                                                             Best Melodic Rap Performance
## 173                                                                                      Best Merengue Album
## 174                                                                                Best Merengue Performance
## 175                                                                        Best Metal Performance With Vocal
## 176                                                                              Best Mexican-American Album
## 177                                                                  Best Mexican-American Music Performance
## 178                                                           Best Mexican-American/Tejano Music Performance
## 179                                                                             Best Music Video - Long Form
## 180                                                                            Best Music Video - Short Form
## 181                                                                              Best Music Video, Long Form
## 182                                                                             Best Music Video, Short Form
## 183                                                                             Best Musical Cast Show Album
## 184                   Best Musical Composition First Recorded And Released In 1958 (Over 5 Minutes Duration)
## 185              Best Musical Composition First Recorded And Released In 1959 (More Than 5 Minutes Duration)
## 186                                                            Best Música Mexicana Album (Including Tejano)
## 187                                                                                 Best Música Urbana Album
## 188                                                                                 Best New Age Performance
## 189                                                                                   Best New Age Recording
## 190                                                                    Best New Age, Ambient, Or Chant Album
## 191                                                                                  Best New Artist Of 1959
## 192                                                                                  Best New Artist Of 1960
## 193                                                                                  Best New Artist Of 1961
## 194                                                                                  Best New Artist Of 1963
## 195                                                                                  Best New Artist Of 1964
## 196                                                                                Best New Classical Artist
## 197                                                                           Best New Classical Composition
## 198                                                                        Best New Country & Western Artist
## 199                                                                Best New Country & Western Artist Of 1964
## 200                                                                                    Best New Country Song
## 201                                                                                       Best Norteño Album
## 202                                                                                Best Orchestral Recording
## 203                                                                Best Original Cast Album (Broadway Or Tv)
## 204                                                                            Best Original Cast Show Album
## 205                                             Best Original Score From A Motion Picture Or Television Show
## 206                                    Best Original Score Written For A Motion Picture Or A Television Show
## 207                                      Best Original Score Written For A Motion Picture Or Television Show
## 208                                        Best Performance - Documentary Or Spoken Word (Other Than Comedy)
## 209                                                                   Best Performance By A Band For Dancing
## 210                                                                             Best Performance By A Chorus
## 211                                                         Best Performance By A Chorus (7 Or More Persons)
## 212                                                                         Best Performance By A Dance Band
## 213                                                                  Best Performance By A Pop Single Artist
## 214                                                                        Best Performance By A Vocal Group
## 215                                                               Best Performance By A Vocal Group (2 To 6)
## 216                                                              Best Performance By A Vocal Group Or Chorus
## 217                                                Best Performance By An Orchestra - For Other Than Dancing
## 218   Best Performance By An Orchestra Or Instrumentalist With Orchestra - Primarily Not Jazz Or For Dancing
## 219                                                                             Best Performance Music Video
## 220                                                                        Best Performance Of A Choral Work
## 221                                                                                           Best Pop Album
## 222                                                                                 Best Pop Dance Recording
## 223                                                                                    Best Pop Gospel Album
## 224                                          Best Pop Instrumental Performance (Orchestra, Group Or Soloist)
## 225                                           Best Pop Instrumental Performance By An Instrumental Performer
## 226                                         Best Pop Instrumental Performance, (Orchestra, Group Or Soloist)
## 227                                                              Best Pop Perf. By A Duo Of Group With Vocal
## 228                                                       Best Pop Performance By A Duo Or Group With Vocals
## 229                                                                             Best Pop Vocal Collaboration
## 230                                                     Best Pop Vocal Performance By A Duo, Group Or Chorus
## 231                                                                    Best Pop Vocal Performance By A Group
## 232                                                       Best Pop Vocal Performance By Duo, Group Or Chorus
## 233                                                                                Best Producer Of The Year
## 234                                                                               Best Progressive R&B Album
## 235                                                       Best R&B Performance By A Duo Or Group With Vocals
## 236                                            Best R&B Performance By A Duo Or Group, Vocal Or Instrumental
## 237                                                             Best R&B Vocal Performance By A Duo Or Group
## 238                                                                    Best R&B Vocal Performance By A Group
## 239                                                                                Best Rap/Sung Performance
## 240                                         Best Recording For Children - Single Or Album, Musical Or Spoken
## 241                                                                           Best Recording Package - Boxed
## 242                                                                              Best Regional Mexican Album
## 243                                             Best Rhythm & Blues Group Performance, Vocal Or Instrumental
## 244                                 Best Rhythm & Blues Performance By A Duo Or Group, Vocal Or Instrumental
## 245                                                       Best Rhythm & Blues Solo Vocal Performance, Female
## 246                                                         Best Rhythm & Blues Solo Vocal Performance, Male
## 247                                               Best Rhythm & Blues Solo Vocal Performance, Male Or Female
## 248                                                            Best Rhythm & Blues Vocal Performance, Female
## 249                                                              Best Rhythm & Blues Vocal Performance, Male
## 250                                                                               Best Rock & Roll Recording
## 251                                         Best Rock Instrumental Performance (Orchestra, Group Or Soloist)
## 252                                        Best Rock Instrumental Performance, (Orchestra, Group Or Soloist)
## 253                                                                            Best Rock Or Rap Gospel Album
## 254                                                      Best Rock Performance By A Duo Or Group With Vocals
## 255                                                                     Best Rock Vocal Performance - Female
## 256                                                                Best Rock Vocal Performance, Female, Male
## 257                                                                        Best Rock Vocal Performance, Solo
## 258                                                                      Best Rock/Contemporary Gospel Album
## 259                                                                                  Best Sacred Performance
## 260                                                                        Best Sacred Performance (Musical)
## 261                                                                  Best Sacred Performance (Non-Classical)
## 262                                                                                         Best Salsa Album
## 263                                                                                   Best Salsa Performance
## 264                                                                                Best Salsa/Merengue Album
## 265                                                             Best Score From The Original Cast Show Album
## 266                       Best Score Soundtrack Album For A Motion Picture, Television Or Other Visual Media
## 267                         Best Score Soundtrack Album For Motion Picture, Television Or Other Visual Media
## 268                                        Best Score Soundtrack For Video Games And Other Interactive Media
## 269                                    Best Score Soundtrack For Visual Media (Includes Film And Television)
## 270                                                                          Best Show Album (Original Cast)
## 271                                                                          Best Small Ensemble Performance
## 272                                                                         Best Solo Rock Vocal Performance
## 273                                                                        Best Solo Vocal Performance, Male
## 274                                                 Best Song Written For A Motion Picture Or For Television
## 275                                 Best Song Written For A Motion Picture, Television Or Other Visual Media
## 276                                Best Song Written For A Motion Picture, Television Or Other Visual Media.
## 277                                   Best Song Written For Motion Picture, Television Or Other Visual Media
## 278                                    Best Song Written Specifically For A Motion Picture Or For Television
## 279                                        Best Song Written Specifically For A Motion Picture Or Television
## 280                                                                      Best Soul Gospel Performance - Male
## 281                                                           Best Soul Gospel Performance By A Duo Or Group
## 282                                          Best Soul Gospel Performance By A Duo Or Group, Choir Or Chorus
## 283                                            Best Soul Gospel Performance By A Duo, Group, Choir Or Chorus
## 284                Best Soul Gospel Performance By A Duo, Group, Choir Or Chorus - Singles, Albums Or Tracks
## 285                                                                       Best Soul Gospel Performance, Male
## 286                                      Best Soul Gospel Vocal Performance By A Duo, Group, Choir Or Chorus
## 287                                                         Best Soul Gospel Vocal Performance, Female, Male
## 288                            Best Sound Track Album - Background Score From A Motion Picture Or Television
## 289                   Best Sound Track Album Or Recording Of Original Cast From Motion Picture Or Television
## 290                           Best Sound Track Album Or Recording Of Score From Motion Picture Of Television
## 291                                          Best Sound Track Album, Dramatic Picture Score Or Original Cast
## 292                                     Best Sound Track Album, Original Cast - Motion Picture Or Television
## 293                                                                                    Best Soundtrack Album
## 294                    Best Soundtrack Album Or Recording Of Music Score From A Motion Picture Of Television
## 295                                                                               Best Southern Gospel Album
## 296                                                  Best Southern Gospel, Country Gospel Or Bluegrass Album
## 297                                           Best Southern Gospel, Country Gospel Or Bluegrass Gospel Album
## 298                                                         Best Southern, Country Or Bluegrass Gospel Album
## 299                                    Best Spoken Word Album (Includes Poetry, Audio Books & Story Telling)
## 300                                                                    Best Spoken Word Or Non-Musical Album
## 301                                                                            Best Spoken Word Poetry Album
## 302                                                                            Best Tejano Music Performance
## 303                                                                                  Best Tejano Performance
## 304                                                                            Best Traditional Gospel Album
## 305                                                                         Best Traditional Pop Performance
## 306                                                                         Best Traditional R&B Vocal Album
## 307                                                                 Best Traditional Soul Gospel Performance
## 308                                                                    Best Traditional Tropical Latin Album
## 309                                                                       Best Traditional World Music Album
## 310                                                                            Best Urban Contemporary Album
## 311                                                                       Best Urban/Alternative Performance
## 312                                                                                   Best Video, Short Form
## 313                                                            Best Vocal Arrangement For Two Or More Voices
## 314                                                                     Best Vocal Performance Album, Female
## 315                                                                       Best Vocal Performance Album, Male
## 316                                                    Best Vocal Performance Single Record Or Track, Female
## 317                                                      Best Vocal Performance Single Record Or Track, Male
## 318                                               Best Vocal Soloist Performance (With Or Without Orchestra)
## 319                                                                         Best Zydeco Or Cajun Music Album
## 320                                                                                          Bluegrass Album
## 321                                                                                              Blues Album
## 322                                                                 Boxed Or Special Limited Edition Package
## 323                                                                                Chamber Music Performance
## 324                                                                                         Children'S Album
## 325                                                                                       Choral Performance
## 326                                                                                          Classical Album
## 327                                                                       Classical Contemporary Composition
## 328                                                                                      Classical Crossover
## 329                                                                              Classical Vocal Performance
## 330                                                                                     Classical Vocal Solo
## 331                                                                                             Comedy Album
## 332                                                                             Compilation Soundtrack Album
## 333                                                                                 Contemporary Blues Album
## 334                                                                        Contemporary Christian Music Song
## 335                                                                       Contemporary Classical Composition
## 336                                                                                  Contemporary Folk Album
## 337                                                                                  Contemporary Jazz Album
## 338                                                                                   Contemporary R&B Album
## 339                                                                            Contemporary R&B Gospel Album
## 340                                                                           Contemporary World Music Album
## 341                                                                                            Country Album
## 342                                                                         Country Collaboration With Vocal
## 343                                                                            Country Duo/Group Performance
## 344                                                                         Country Instrumental Performance
## 345                                                        Country Performance By A Duo Or Group With Vocals
## 346                                                                                 Country Solo Performance
## 347                                                                                          Dance Recording
## 348                                                                                  Dance/Electronica Album
## 349                                                                                   Electronic/Dance Album
## 350                                                                              Engineered Album, Classical
## 351                                                                          Engineered Album, Non-Classical
## 352                                                                         Female Country Vocal Performance
## 353                                                                             Female Pop Vocal Performance
## 354                                                                             Female R&B Vocal Performance
## 355                                                                                               Folk Album
## 356                                                                                             Gospel Album
## 357                                                                                       Gospel Performance
## 358                                                                                              Gospel Song
## 359                                                          Gospel/Contemporary Christian Music Performance
## 360                                                                                    Hard Rock Performance
## 361                                                                              Hard Rock/Metal Performance
## 362                                                                                     Hawaiian Music Album
## 363                                                                                         Historical Album
## 364                                                                                     Improvised Jazz Solo
## 365                                                                                 Instrumental Arrangement
## 366                                                                Instrumental Arrangement With Vocalist(S)
## 367                                                                                 Instrumental Composition
## 368                                                                                        Instrumental Solo
## 369                                                       Instrumental Soloist Performance (Without Orchestr
## 370                                                       Instrumental Soloist(S) Performance (With Orchestr
## 371                                                             Jazz Instrumental Album, Individual Or Group
## 372                                                                                         Jazz Vocal Album
## 373                                                                                Large Jazz Ensemble Album
## 374                                                                                         Latin Jazz Album
## 375                                                                                          Latin Pop Album
## 376                                                                          Latin Pop, Rock, Or Urban Album
## 377                                                                   Latin Rock, Alternative Or Urban Album
## 378                                                                           Male Country Vocal Performance
## 379                                                                               Male Pop Vocal Performance
## 380                                                                               Male R&B Vocal Performance
## 381                                                                                        Metal Performance
## 382                                                            Most Promising New Classical Recording Artist
## 383                                                                                    Music Video/Long Form
## 384                                                                                   Music Video/Short Form
## 385                                                                               Musical Album For Children
## 386                                                                                       Musical Show Album
## 387                                                                                    Musical Theater Album
## 388                                                                              Native American Music Album
## 389                                                                                            New Age Album
## 390                                                                                            Norteño Album
## 391                                                                                          Opera Recording
## 392                                                                                   Orchestral Performance
## 393                                                                            Pop Collaboration With Vocals
## 394                                                                                Pop Duo/Group Performance
## 395                                                                                   Pop Instrumental Album
## 396                                                                             Pop Instrumental Performance
## 397                                                            Pop Performance By A Duo Or Group With Vocals
## 398                                                                                     Pop Solo Performance
## 399                                                                                          Pop Vocal Album
## 400                                                                            Pop/Contemporary Gospel Album
## 401                                                                    Producer Of The Year, (Non-Classical)
## 402                                                                                                R&B Album
## 403                                                                                          R&B Performance
## 404                                                            R&B Performance By A Duo Or Group With Vocals
## 405                                                                                                 R&B Song
## 406                                                                                                Rap Album
## 407                                                                                Rap Duo/Group Performance
## 408                                                                                          Rap Performance
## 409                                                                                     Rap Solo Performance
## 410                                                                                                 Rap Song
## 411                                                                                   Rap/Sung Collaboration
## 412                                                                                        Recording Package
## 413                                                                                             Reggae Album
## 414                                                                         Regional Mexican Or Tejano Album
## 415                                                                               Regional Roots Music Album
## 416                                                                       Remixer Of The Year, Non-Classical
## 417                                                                                               Rock Album
## 418                                                                            Rock Instrumental Performance
## 419                                                                                 Rock Or Rap Gospel Album
## 420                                                                                         Rock Performance
## 421                                                           Rock Performance By A Duo Or Group With Vocals
## 422                                                                                                Rock Song
## 423                                                                                   Score Soundtrack Album
## 424                                                                               Small Ensemble Performance
## 425                                                                              Solo Rock Vocal Performance
## 426                                                                                           Song Mp/Tv/Ovm
## 427                                                                    Songwriter Of The Year, Non-Classical
## 428                                                             Southern, Country, Or Bluegrass Gospel Album
## 429                                                                                        Spoken Word Album
## 430                                                                           Spoken Word Album For Children
## 431                                                                                     Surround Sound Album
## 432                                                                                             Tejano Album
## 433                                                                                  Traditional Blues Album
## 434                                                                                   Traditional Folk Album
## 435                                                                                 Traditional Gospel Album
## 436                                                                              Traditional Pop Vocal Album
## 437                                                                              Traditional R&B Performance
## 438                                                                        Traditional R&B Vocal Performance
## 439                                                                            Traditional World Music Album
## 440                                                                                     Tropical Latin Album
## 441                                                                            Urban/Alternative Performance
## 442                                                                                        Video Of The Year
## 443                                                                                        World Music Album
## 444                                                                              Zydeco Or Cajun Music Album
## 445                                                                                       Best Album Package
## 446                                                                             Best Alternative Music Album
## 447                                                                                     Best Bluegrass Album
## 448                                                            Best Boxed Or Special Limited Edition Package
## 449                                                                                  Best Choral Performance
## 450                                                                                     Best Classical Album
## 451                                                                   Best Classical Performance - Orchestra
## 452                                                                         Best Classical Vocal Performance
## 453                                                                 Best Classical Vocal Soloist Performance
## 454                                                                                        Best Comedy Album
## 455                                                                                    Best Comedy Recording
## 456                                                             Best Compilation Soundtrack For Visual Media
## 457                                                                            Best Contemporary Blues Album
## 458                                                                                       Best Country Album
## 459                                                                    Best Country Instrumental Performance
## 460                                                    Best Country Performance By A Duo Or Group With Vocal
## 461                                                                   Best Country Vocal Performance, Female
## 462                                                                     Best Country Vocal Performance, Male
## 463                                                                                     Best Dance Recording
## 464                                                                         Best Engineered Album, Classical
## 465                                                                     Best Engineered Album, Non-Classical
## 466                                                                Best Engineered Recording - Non-Classical
## 467                                                                     Best Engineered Recording, Classical
## 468                                                                            Best Instrumental Arrangement
## 469                                                                                    Best Jazz Vocal Album
## 470                                                                           Best Large Jazz Ensemble Album
## 471                                                                                    Best Latin Jazz Album
## 472                                                                                     Best Latin Pop Album
## 473                                                                                   Best Metal Performance
## 474                                                                                       Best New Age Album
## 475                                                                              Best Orchestral Performance
## 476                                                                                         Best Polka Album
## 477                                                                        Best Pop Instrumental Performance
## 478                                                        Best Pop Performance By A Duo Or Group With Vocal
## 479                                                                                     Best Pop Vocal Album
## 480                                                                       Best Pop Vocal Performance, Female
## 481                                                                         Best Pop Vocal Performance, Male
## 482                                                                                           Best R&B Album
## 483                                                        Best R&B Performance By A Duo Or Group With Vocal
## 484                                                                                            Best R&B Song
## 485                                                                       Best R&B Vocal Performance, Female
## 486                                                                         Best R&B Vocal Performance, Male
## 487                                                                                           Best Rap Album
## 488                                                                              Best Recording For Children
## 489                                                                                   Best Recording Package
## 490                                                                                        Best Reggae Album
## 491                                                                                 Best Rhythm & Blues Song
## 492                                                                                          Best Rock Album
## 493                                                                       Best Rock Instrumental Performance
## 494                                                       Best Rock Performance By A Duo Or Group With Vocal
## 495                                                                                           Best Rock Song
## 496                                                                             Best Traditional Blues Album
## 497                                                                         Best Traditional Pop Vocal Album
## 498                                                                                Best Tropical Latin Album
## 499                                                                                   Best World Music Album
## 500                                                                           Classical Producer Of The Year
## 501                                                                          Producer Of The Year, Classical
## 502                                                                      Producer Of The Year, Non-Classical
## 503                                                                                        Album Of The Year
## 504                                                                                         Best Album Notes
## 505                                                                           Best Chamber Music Performance
## 506                                                                                        Best Country Song
## 507                                                                                    Best Historical Album
## 508                                                                            Best Instrumental Composition
## 509                                                                                          Best New Artist
## 510                                                                                     Best Opera Recording
## 511                                                                                       Record Of The Year
## 512                                                                                         Song Of The Year
## 513                                                                            Album Of The Year - Classical
## 514                                                                              Album Of The Year Classical
## 515                                                                             Album Of The Year, Classical
## 516                                     Best Accompaniment Arrangement For Vocalist(S) Or Instrumentalist(S)
## 517                                                                                         Best Album Cover
## 518                                                                             Best Album Cover - Classical
## 519                                                                          Best Album Cover - Graphic Arts
## 520                                                                  Best Album Cover - Other Than Classical
## 521                                                                           Best Album Cover - Photography
## 522                                                                           Best Album Cover, Graphic Arts
## 523                                                                            Best Album Cover, Photography
## 524                                                                          Best Album Created For Children
## 525                                                                             Best Album Notes (Classical)
## 526                                                                             Best Album Notes - Classical
## 527                                                                              Best Album Notes, Classical
## 528                                                                                         Best Arrangement
## 529                                              Best Arrangement Accompanying A Vocalist Or Instrumentalist
## 530                                                                     Best Arrangement Accompanying Vocals
## 531                                                                              Best Background Arrangement
## 532                                         Best Background Arrangement (Behind Vocalist Or Instrumentalist)
## 533                                                   Best Chamber Music Performance - Instrumental Or Vocal
## 534                                                                   Best Chamber Music Performance - Vocal
## 535                                                                  Best Chamber Performance - Instrumental
## 536                                                              Best Choral Performance, (Other Than Opera)
## 537                                                    Best Choral Performance, Classical (Other Than Opera)
## 538                                         Best Classical Chamber Music Performance - Instrumental Or Vocal
## 539                                                                        Best Classical Choral Performance
## 540                                                     Best Classical Choral Performance (Other Than Opera)
## 541                                                    Best Classical Composition By A Contemporary Composer
## 542                                                      Best Classical Composition By Contemporary Composer
## 543                                                                          Best Classical Opera Production
## 544                                                                    Best Classical Orchestral Performance
## 545                                                 Best Classical Performance - Choral (Including Oratorio)
## 546                                                   Best Classical Performance - Choral (Other Than Opera)
## 547                                            Best Classical Performance - Concerto Or Instrumental Soloist
## 548 Best Classical Performance - Concerto Or Instrumental Soloist (Other Than Full Orchestral Accompaniment)
## 549      Best Classical Performance - Instrumental Soloist Or Duo (Other Than With Orchestral Accompaniment)
## 550                             Best Classical Performance - Instrumental Soloist Or Duo (Without Orchestra)
## 551                Best Classical Performance - Instrumental Soloist Or Soloists (With Or Without Orchestra)
## 552                        Best Classical Performance - Instrumental Soloist Or Soloists (Without Orchestra)
## 553                                    Best Classical Performance - Instrumental Soloist(S) (With Orchestra)
## 554                         Best Classical Performance - Instrumentalist (With Concerto Scale Accompaniment)
## 555                                                          Best Classical Performance - Operatic Or Choral
## 556                                       Best Classical Performance - Vocal Or Instrumental - Chamber Music
## 557                                                               Best Classical Performance - Vocal Soloist
## 558                                              Best Classical Performance Instrumental Solo With Orchestra
## 559                             Best Classical Performance Instrumental Soloist Or Soloists (With Orchestra)
## 560                          Best Classical Performance Instrumental Soloist Or Soloists (Without Orchestra)
## 561                            Best Classical Performance, Instrumental Soloist Or Soloists (With Orchestra)
## 562                         Best Classical Performance, Instrumental Soloist Or Soloists (Without Orchestra)
## 563                                     Best Classical Performance, Instrumental Soloist(S) (With Orchestra)
## 564                                  Best Classical Performance, Instrumental Soloist(S) (Without Orchestra)
## 565                                                                    Best Classical Performance, Orchestra
## 566                                                                        Best Contemporary (R&R) Recording
## 567                                              Best Contemporary Group Performance (Vocal Or Instrumental)
## 568                                                    Best Contemporary-Pop Performance, Vocal Duo Or Group
## 569                          Best Country & Western Performance Duet, Trio Or Group (Vocal Or Instrumental)_
## 570                                                          Best Country & Western Vocal Performance - Male
## 571                                                       Best Country Performance By A Duo Group With Vocal
## 572                                                                          Best Dance/Electronic Recording
## 573                                            Best Documentary Or Spoken Word Recording (Other Than Comedy)
## 574                                     Best Documentary, Spoken Word Or Drama Recording (Other Than Comedy)
## 575                                                                                Best Engineered Recording
## 576                                                                    Best Engineered Recording (Classical)
## 577                                                                    Best Engineered Recording - Classical
## 578                                                         Best Engineered Recording - Other Than Classical
## 579                                                     Best Engineered Recording - Special Or Novel Effects
## 580                                                        Best Engineering Contribution - Novelty Recording
## 581                              Best Engineering Contribution - Other Than Novelty And Other Than Classical
## 582                                                        Best Engineering Contribution - Popular Recording
## 583                                                                                    Best Folk Performance
## 584                                                                                      Best Folk Recording
## 585                                                                            Best Global Music Performance
## 586                                                                     Best Gospel Album By Choir Or Chorus
## 587                                                                 Best Gospel Or Other Religious Recording
## 588                                                       Best Gospel Or Other Religious Recording (Musical)
## 589                                                  Best Gospel Performance, Contemporary Or Insprirational
## 590                                                                    Best Gospel Vocal Performance, Female
## 591                                                                      Best Gospel Vocal Performance, Male
## 592                                                                         Best Hard Rock/Metal Performance
## 593                                                   Best Instrumental Arrangement With Accompanying Vocals
## 594                                         Best Instrumental Jazz Performance - Group Or Soloist With Group
## 595                                                         Best Instrumental Jazz Performance - Large Group
## 596                             Best Instrumental Jazz Performance - Large Group Or Soloist With Large Group
## 597                             Best Instrumental Jazz Performance - Small Group Or Soloist With Small Group
## 598                                              Best Instrumental Jazz Performance - Soloist Or Small Group
## 599                              Best Instrumental Jazz Performance, Large Group Or Soloist With Large Group
## 600                              Best Instrumental Jazz Performance, Small Group Or Soloist With Small Group
## 601                                                 Best Jazz Composition Of More Than Five Minutes Duration
## 602                                                       Best Jazz Performance - Large Group (Instrumental)
## 603                                          Best Jazz Performance - Large Group Or Soloist With Large Group
## 604                                          Best Jazz Performance - Small Group Or Soloist With Small Group
## 605                                                                          Best Jazz Performance - Soloist
## 606                                            Best Jazz Performance - Soloist Or Small Group (Instrumental)
## 607                                                        Best Jazz Performance By A Soloist (Instrumental)
## 608                                                                Best Jazz Performance Solo Or Small Group
## 609                                                                     Best Jazz Vocal Performance - Female
## 610                                                                               Best Music Video-Long Form
## 611                                                                                  Best New Artist Of 1962
## 612                                                                           Best Original Jazz Composition
## 613                                                                                  Best Performance - Folk
## 614                                     Best Performance - Instrumental Soloist Or Soloists (With Orchestra)
## 615                                  Best Performance - Instrumental Soloist Or Soloists (Without Orchestra)
## 616                                                                             Best Performance - Orchestra
## 617                                                                    Best Performance By A "Top 40" Artist
## 618                                                                         Best Performance By An Orchestra
## 619                                                           Best Performance By An Orchestra - For Dancing
## 620                                                             Best Performance By An Orchestra For Dancing
## 621                                                             Best Performance, Documentary Or Spoken Word
## 622               Best Pop Instrumental Performance By An Arranger, Composer, Orchestra And/Or Choral Leader
## 623                                          Best R&B Instrumental Performance (Orchestra, Group Or Soloist)
## 624                                                                          Best Rhythm & Blues Performance
## 625                                                            Best Rock Vocal Performance By A Duo Or Group
## 626                                                                          Best Sacred Recording (Musical)
## 627                                                                      Best Solo Vocal Performance, Female
## 628                                                                      Best Spoken Word Or Drama Recording
## 629                                                              Best Traditional Tropical Latin Performance
## 630                                                                                               Best Video
## 631                                                                                         Best Video Album
## 632                                                                           Best Vocal Soloist Performance
## 633                                                                Best Vocal Soloist Performance, Classical
## 634                                                                       Contemporary Christian Music Album
## 635                                                                                             Country Song
## 636                                                                                  Jazz Instrumental Album
## 637                                                                            Song Written For Visual Media
## 638                        Best Album Of Original Score Written For A Motion Picture Or A Television Special
## 639                                                                       Best Alternative Music Performance
## 640                                                                          Best American Roots Performance
## 641                                                                                 Best American Roots Song
## 642                                                                                     Best Americana Album
## 643                                                                Best Arrangement Accompanying Vocalist(S)
## 644                                                                      Best Arrangement On An Instrumental
## 645                                                             Best Arrangement, Instrumental Or A Cappella
## 646                                                                 Best Arrangement, Instruments And Vocals
## 647                                                                                     Best Cast Show Album
## 648                                                            Best Chamber Music/Small Ensemble Performance
## 649                                                               Best Choral Performance (Other Than Opera)
## 650                                                                                Best Classical Compendium
## 651                                                                  Best Classical Contemporary Composition
## 652                                                                           Best Classical Crossover Album
## 653                                                                         Best Classical Instrumental Solo
## 654                                                                      Best Classical Orchestral Recording
## 655                           Best Classical Performance - Instrumental Soloist Or Soloists (With Orchestra)
## 656                                                                                  Best Comedy Performance
## 657                 Best Compilation Soundtrack Album For A Motion Picture, Television Or Other Visual Media
## 658                   Best Compilation Soundtrack Album For Motion Picture, Television Or Other Visual Media
## 659                                                                  Best Contemporary Christian Music Album
## 660                                                       Best Contemporary Christian Music Performance/Song
## 661                                                                  Best Contemporary Classical Composition
## 662                                                                            Best Contemporary Composition
## 663                                                                             Best Contemporary Folk Album
## 664                                                                     Best Contemporary Instrumental Album
## 665                                                                             Best Contemporary Jazz Album
## 666                                                                       Best Contemporary Jazz Performance
## 667                                                                              Best Contemporary R&B Album
## 668                                                                      Best Contemporary Soul Gospel Album
## 669                                                                   Best Country Collaboration With Vocals
## 670                                                                       Best Country Duo/Group Performance
## 671                                                                            Best Country Solo Performance
## 672                                                                         Best Country Vocal Collaboration
## 673                                                         Best Country Vocal Performance By A Duo Or Group
## 674                                                                              Best Dance/Electronic Album
## 675                                                                     Best Ethnic Or Traditional Recording
## 676                                                                    Best Female Country Vocal Performance
## 677                                                                        Best Female Pop Vocal Performance
## 678                                                                        Best Female R&B Vocal Performance
## 679                                                                       Best Female Rock Vocal Performance
## 680                                                                                          Best Folk Album
## 681                                                                                        Best Gospel Album
## 682                                                                        Best Gospel Choir Or Chorus Album
## 683                                                                                  Best Gospel Performance
## 684                                                         Best Gospel Performance (Other Than Soul Gospel)
## 685                                                                     Best Gospel Performance, Traditional
## 686                                                                             Best Gospel Performance/Song
## 687                                                                                         Best Gospel Song
## 688                                                                               Best Hard Rock Performance
## 689                                                                                Best Hawaiian Music Album
## 690                                                                               Best Immersive Audio Album
## 691                                                                                Best Improvised Jazz Solo
## 692                                                                           Best Inspirational Performance
## 693                                                      Best Instrumental Arrangement Accompanying Vocal(S)
## 694                                                   Best Instrumental Arrangement Accompanying Vocalist(S)
## 695                             Best Instrumental Composition Written For A Motion Picture Or For Television
## 696                                                Best Instrumental Soloist Performance (Without Orchestra)
## 697                                                Best Instrumental Soloist(S) Performance (With Orchestra)
## 698                                                      Best Jazz Fusion Performance, Vocal Or Instrumental
## 699                                                                             Best Jazz Instrumental Album
## 700                                                        Best Jazz Instrumental Album, Individual Or Group
## 701                                                             Best Jazz Instrumental Performance, Big Band
## 702                                                                Best Jazz Instrumental Performance, Group
## 703                                                  Best Jazz Instrumental Performance, Individual Or Group
## 704                                                              Best Jazz Instrumental Performance, Soloist
## 705                                                                              Best Jazz Instrumental Solo
## 706                                                                         Best Jazz Performance By A Group
## 707                                                                              Best Jazz Vocal Performance
## 708                                                                      Best Jazz Vocal Performance, Female
## 709                                                                        Best Jazz Vocal Performance, Male
## 710                                                                     Best Large Jazz Ensemble Performance
## 711                                                                               Best Latin Pop Performance
## 712                                                                                     Best Latin Recording
## 713                                                                     Best Latin Rock Or Alternative Album
## 714                                                                               Best Long Form Music Video
## 715                                                                      Best Male Country Vocal Performance
## 716                                                                          Best Male Pop Vocal Performance
## 717                                                                          Best Male R&B Vocal Performance
## 718                                                                         Best Male Rock Vocal Performance
## 719                                                                        Best Mexican-American Performance
## 720                                                                      Best Mexican/Mexican-American Album
## 721                                                                                          Best Music Film
## 722                                                                                         Best Music Video
## 723                                                                          Best Musical Album For Children
## 724                                                                                  Best Musical Show Album
## 725                                                                               Best Musical Theater Album
## 726                                                                         Best Native American Music Album
## 727                                                                              Best New Artist Of The Year
## 728                                 Best Original Score Written For A Motion Picture Or A Television Special
## 729                                                                                     Best Polka Recording
## 730                                                                       Best Pop Collaboration With Vocals
## 731                                                                           Best Pop Duo/Group Performance
## 732                                                                              Best Pop Instrumental Album
## 733                                                                                Best Pop Solo Performance
## 734                                                                       Best Pop/Contemporary Gospel Album
## 735                                                                        Best R&B Instrumental Performance
## 736                                                                                     Best R&B Performance
## 737                                                     Best R&B Vocal Performance By A Duo, Group Or Chorus
## 738                                                                                     Best Rap Performance
## 739                                                                   Best Rap Performance By A Duo Or Group
## 740                                                                                Best Rap Solo Performance
## 741                                                                                            Best Rap Song
## 742                                                                              Best Rap/Sung Collaboration
## 743                                                                                    Best Reggae Recording
## 744                                                     Best Regional Mexican Music Album (Including Tejano)
## 745                                                                          Best Regional Roots Music Album
## 746                                                                                   Best Remixed Recording
## 747                                                                    Best Remixed Recording, Non-Classical
## 748                                                                            Best Rhythm & Blues Recording
## 749                                                                                   Best Rock Gospel Album
## 750                                                                                    Best Rock Performance
## 751                                                                      Best Rock Vocal Performance, Female
## 752                                                                        Best Rock Vocal Performance, Male
## 753                                                                                  Best Roots Gospel Album
## 754                                                              Best Score From An Original Cast Show Album
## 755                                                                   Best Score Soundtrack For Visual Media
## 756                                                                              Best Short Form Music Video
## 757                                              Best Small Ensemble Performance (With Or Without Conductor)
## 758                                                                       Best Song Written For Visual Media
## 759                                                                             Best Soul Gospel Performance
## 760                                                               Best Soul Gospel Performance, Contemporary
## 761                                                                     Best Soul Gospel Performance, Female
## 762                                                                Best Soul Gospel Performance, Traditional
## 763                                                        Best Southern, Country, Or Bluegrass Gospel Album
## 764                                                                                 Best Spoken Comedy Album
## 765                                                                                   Best Spoken Word Album
## 766                                     Best Spoken Word Album (Includes Poetry, Audio Books & Storytelling)
## 767                                                                      Best Spoken Word Album For Children
## 768                                                                Best Spoken Word Or Non-Musical Recording
## 769                                                                               Best Spoken Word Recording
## 770                                                         Best Spoken Word, Documentary Or Drama Recording
## 771                                                                                Best Surround Sound Album
## 772                                                                                        Best Tejano Album
## 773                                                                         Best Traditional Blues Recording
## 774                                                                              Best Traditional Folk Album
## 775                                                                          Best Traditional Folk Recording
## 776                                                                   Best Traditional Pop Vocal Performance
## 777                                                                         Best Traditional R&B Performance
## 778                                                                   Best Traditional R&B Vocal Performance
## 779                                                                       Best Traditional Soul Gospel Album
## 780                                                                          Best Tropical Latin Performance
## 781                                                                           Best Vocal Performance, Female
## 782                                                                             Best Vocal Performance, Male
## 783                                                                                     Producer Of The Year
## 784                                                                     Producer Of The Year (Non-Classical)
##     cluster
## 1         1
## 2         1
## 3         1
## 4         1
## 5         1
## 6         1
## 7         1
## 8         1
## 9         1
## 10        1
## 11        1
## 12        1
## 13        1
## 14        1
## 15        1
## 16        1
## 17        1
## 18        1
## 19        1
## 20        1
## 21        1
## 22        1
## 23        1
## 24        1
## 25        1
## 26        1
## 27        1
## 28        1
## 29        1
## 30        1
## 31        1
## 32        1
## 33        1
## 34        1
## 35        1
## 36        1
## 37        1
## 38        1
## 39        1
## 40        1
## 41        1
## 42        1
## 43        1
## 44        1
## 45        1
## 46        1
## 47        1
## 48        1
## 49        1
## 50        1
## 51        1
## 52        1
## 53        1
## 54        1
## 55        1
## 56        1
## 57        1
## 58        1
## 59        1
## 60        1
## 61        1
## 62        1
## 63        1
## 64        1
## 65        1
## 66        1
## 67        1
## 68        1
## 69        1
## 70        1
## 71        1
## 72        1
## 73        1
## 74        1
## 75        1
## 76        1
## 77        1
## 78        1
## 79        1
## 80        1
## 81        1
## 82        1
## 83        1
## 84        1
## 85        1
## 86        1
## 87        1
## 88        1
## 89        1
## 90        1
## 91        1
## 92        1
## 93        1
## 94        1
## 95        1
## 96        1
## 97        1
## 98        1
## 99        1
## 100       1
## 101       1
## 102       1
## 103       1
## 104       1
## 105       1
## 106       1
## 107       1
## 108       1
## 109       1
## 110       1
## 111       1
## 112       1
## 113       1
## 114       1
## 115       1
## 116       1
## 117       1
## 118       1
## 119       1
## 120       1
## 121       1
## 122       1
## 123       1
## 124       1
## 125       1
## 126       1
## 127       1
## 128       1
## 129       1
## 130       1
## 131       1
## 132       1
## 133       1
## 134       1
## 135       1
## 136       1
## 137       1
## 138       1
## 139       1
## 140       1
## 141       1
## 142       1
## 143       1
## 144       1
## 145       1
## 146       1
## 147       1
## 148       1
## 149       1
## 150       1
## 151       1
## 152       1
## 153       1
## 154       1
## 155       1
## 156       1
## 157       1
## 158       1
## 159       1
## 160       1
## 161       1
## 162       1
## 163       1
## 164       1
## 165       1
## 166       1
## 167       1
## 168       1
## 169       1
## 170       1
## 171       1
## 172       1
## 173       1
## 174       1
## 175       1
## 176       1
## 177       1
## 178       1
## 179       1
## 180       1
## 181       1
## 182       1
## 183       1
## 184       1
## 185       1
## 186       1
## 187       1
## 188       1
## 189       1
## 190       1
## 191       1
## 192       1
## 193       1
## 194       1
## 195       1
## 196       1
## 197       1
## 198       1
## 199       1
## 200       1
## 201       1
## 202       1
## 203       1
## 204       1
## 205       1
## 206       1
## 207       1
## 208       1
## 209       1
## 210       1
## 211       1
## 212       1
## 213       1
## 214       1
## 215       1
## 216       1
## 217       1
## 218       1
## 219       1
## 220       1
## 221       1
## 222       1
## 223       1
## 224       1
## 225       1
## 226       1
## 227       1
## 228       1
## 229       1
## 230       1
## 231       1
## 232       1
## 233       1
## 234       1
## 235       1
## 236       1
## 237       1
## 238       1
## 239       1
## 240       1
## 241       1
## 242       1
## 243       1
## 244       1
## 245       1
## 246       1
## 247       1
## 248       1
## 249       1
## 250       1
## 251       1
## 252       1
## 253       1
## 254       1
## 255       1
## 256       1
## 257       1
## 258       1
## 259       1
## 260       1
## 261       1
## 262       1
## 263       1
## 264       1
## 265       1
## 266       1
## 267       1
## 268       1
## 269       1
## 270       1
## 271       1
## 272       1
## 273       1
## 274       1
## 275       1
## 276       1
## 277       1
## 278       1
## 279       1
## 280       1
## 281       1
## 282       1
## 283       1
## 284       1
## 285       1
## 286       1
## 287       1
## 288       1
## 289       1
## 290       1
## 291       1
## 292       1
## 293       1
## 294       1
## 295       1
## 296       1
## 297       1
## 298       1
## 299       1
## 300       1
## 301       1
## 302       1
## 303       1
## 304       1
## 305       1
## 306       1
## 307       1
## 308       1
## 309       1
## 310       1
## 311       1
## 312       1
## 313       1
## 314       1
## 315       1
## 316       1
## 317       1
## 318       1
## 319       1
## 320       1
## 321       1
## 322       1
## 323       1
## 324       1
## 325       1
## 326       1
## 327       1
## 328       1
## 329       1
## 330       1
## 331       1
## 332       1
## 333       1
## 334       1
## 335       1
## 336       1
## 337       1
## 338       1
## 339       1
## 340       1
## 341       1
## 342       1
## 343       1
## 344       1
## 345       1
## 346       1
## 347       1
## 348       1
## 349       1
## 350       1
## 351       1
## 352       1
## 353       1
## 354       1
## 355       1
## 356       1
## 357       1
## 358       1
## 359       1
## 360       1
## 361       1
## 362       1
## 363       1
## 364       1
## 365       1
## 366       1
## 367       1
## 368       1
## 369       1
## 370       1
## 371       1
## 372       1
## 373       1
## 374       1
## 375       1
## 376       1
## 377       1
## 378       1
## 379       1
## 380       1
## 381       1
## 382       1
## 383       1
## 384       1
## 385       1
## 386       1
## 387       1
## 388       1
## 389       1
## 390       1
## 391       1
## 392       1
## 393       1
## 394       1
## 395       1
## 396       1
## 397       1
## 398       1
## 399       1
## 400       1
## 401       1
## 402       1
## 403       1
## 404       1
## 405       1
## 406       1
## 407       1
## 408       1
## 409       1
## 410       1
## 411       1
## 412       1
## 413       1
## 414       1
## 415       1
## 416       1
## 417       1
## 418       1
## 419       1
## 420       1
## 421       1
## 422       1
## 423       1
## 424       1
## 425       1
## 426       1
## 427       1
## 428       1
## 429       1
## 430       1
## 431       1
## 432       1
## 433       1
## 434       1
## 435       1
## 436       1
## 437       1
## 438       1
## 439       1
## 440       1
## 441       1
## 442       1
## 443       1
## 444       1
## 445       2
## 446       2
## 447       2
## 448       2
## 449       2
## 450       2
## 451       2
## 452       2
## 453       2
## 454       2
## 455       2
## 456       2
## 457       2
## 458       2
## 459       2
## 460       2
## 461       2
## 462       2
## 463       2
## 464       2
## 465       2
## 466       2
## 467       2
## 468       2
## 469       2
## 470       2
## 471       2
## 472       2
## 473       2
## 474       2
## 475       2
## 476       2
## 477       2
## 478       2
## 479       2
## 480       2
## 481       2
## 482       2
## 483       2
## 484       2
## 485       2
## 486       2
## 487       2
## 488       2
## 489       2
## 490       2
## 491       2
## 492       2
## 493       2
## 494       2
## 495       2
## 496       2
## 497       2
## 498       2
## 499       2
## 500       2
## 501       2
## 502       2
## 503       3
## 504       3
## 505       3
## 506       3
## 507       3
## 508       3
## 509       3
## 510       3
## 511       3
## 512       3
## 513       4
## 514       4
## 515       4
## 516       4
## 517       4
## 518       4
## 519       4
## 520       4
## 521       4
## 522       4
## 523       4
## 524       4
## 525       4
## 526       4
## 527       4
## 528       4
## 529       4
## 530       4
## 531       4
## 532       4
## 533       4
## 534       4
## 535       4
## 536       4
## 537       4
## 538       4
## 539       4
## 540       4
## 541       4
## 542       4
## 543       4
## 544       4
## 545       4
## 546       4
## 547       4
## 548       4
## 549       4
## 550       4
## 551       4
## 552       4
## 553       4
## 554       4
## 555       4
## 556       4
## 557       4
## 558       4
## 559       4
## 560       4
## 561       4
## 562       4
## 563       4
## 564       4
## 565       4
## 566       4
## 567       4
## 568       4
## 569       4
## 570       4
## 571       4
## 572       4
## 573       4
## 574       4
## 575       4
## 576       4
## 577       4
## 578       4
## 579       4
## 580       4
## 581       4
## 582       4
## 583       4
## 584       4
## 585       4
## 586       4
## 587       4
## 588       4
## 589       4
## 590       4
## 591       4
## 592       4
## 593       4
## 594       4
## 595       4
## 596       4
## 597       4
## 598       4
## 599       4
## 600       4
## 601       4
## 602       4
## 603       4
## 604       4
## 605       4
## 606       4
## 607       4
## 608       4
## 609       4
## 610       4
## 611       4
## 612       4
## 613       4
## 614       4
## 615       4
## 616       4
## 617       4
## 618       4
## 619       4
## 620       4
## 621       4
## 622       4
## 623       4
## 624       4
## 625       4
## 626       4
## 627       4
## 628       4
## 629       4
## 630       4
## 631       4
## 632       4
## 633       4
## 634       4
## 635       4
## 636       4
## 637       4
## 638       5
## 639       5
## 640       5
## 641       5
## 642       5
## 643       5
## 644       5
## 645       5
## 646       5
## 647       5
## 648       5
## 649       5
## 650       5
## 651       5
## 652       5
## 653       5
## 654       5
## 655       5
## 656       5
## 657       5
## 658       5
## 659       5
## 660       5
## 661       5
## 662       5
## 663       5
## 664       5
## 665       5
## 666       5
## 667       5
## 668       5
## 669       5
## 670       5
## 671       5
## 672       5
## 673       5
## 674       5
## 675       5
## 676       5
## 677       5
## 678       5
## 679       5
## 680       5
## 681       5
## 682       5
## 683       5
## 684       5
## 685       5
## 686       5
## 687       5
## 688       5
## 689       5
## 690       5
## 691       5
## 692       5
## 693       5
## 694       5
## 695       5
## 696       5
## 697       5
## 698       5
## 699       5
## 700       5
## 701       5
## 702       5
## 703       5
## 704       5
## 705       5
## 706       5
## 707       5
## 708       5
## 709       5
## 710       5
## 711       5
## 712       5
## 713       5
## 714       5
## 715       5
## 716       5
## 717       5
## 718       5
## 719       5
## 720       5
## 721       5
## 722       5
## 723       5
## 724       5
## 725       5
## 726       5
## 727       5
## 728       5
## 729       5
## 730       5
## 731       5
## 732       5
## 733       5
## 734       5
## 735       5
## 736       5
## 737       5
## 738       5
## 739       5
## 740       5
## 741       5
## 742       5
## 743       5
## 744       5
## 745       5
## 746       5
## 747       5
## 748       5
## 749       5
## 750       5
## 751       5
## 752       5
## 753       5
## 754       5
## 755       5
## 756       5
## 757       5
## 758       5
## 759       5
## 760       5
## 761       5
## 762       5
## 763       5
## 764       5
## 765       5
## 766       5
## 767       5
## 768       5
## 769       5
## 770       5
## 771       5
## 772       5
## 773       5
## 774       5
## 775       5
## 776       5
## 777       5
## 778       5
## 779       5
## 780       5
## 781       5
## 782       5
## 783       5
## 784       5
dist_matrix <- dist(pca_scores[,1:4])
hc <- hclust(dist_matrix, method = "ward.D2")

fviz_dend(hc, k =4, rect = TRUE, cex = 0.7,
          main = "Hierarchical cluster")
## Warning: The `<scale>` argument of `guides()` cannot be `FALSE`. Use "none" instead as
## of ggplot2 3.3.4.
## ℹ The deprecated feature was likely used in the factoextra package.
##   Please report the issue at <https://github.com/kassambara/factoextra/issues>.
## This warning is displayed once every 8 hours.
## Call `lifecycle::last_lifecycle_warnings()` to see where this warning was
## generated.

pca_scores$cluster <- cutree(hc, k = 4)

head(pca_scores)
##          PC1         PC2         PC3         PC4         PC5          PC6
## 1 -1.1044157 -0.55217602  0.21925192  0.05355498 -0.05936641 -0.002080531
## 2 -0.6364625  0.01058981  0.04893569  0.10075898 -0.27701416  0.031270144
## 3 13.8423255  1.03248171  2.35349326 -0.14888725  0.23201006 -0.813138195
## 4 -0.8386164  0.18085460 -0.01130587  0.11160632 -0.17884562  0.028419375
## 5 -0.4488736  1.12979815  0.11571971  0.11951329 -0.39197565 -0.010545411
## 6 -1.3009256 -0.55791188  0.15880058  0.05392879  0.03956304 -0.001195833
##           PC7           PC8
## 1 0.005593733  0.0004271075
## 2 0.003534561  0.0004657184
## 3 0.356287290  0.0651037535
## 4 0.004196861  0.0004942512
## 5 0.031482978 -0.0004465146
## 6 0.009439925  0.0004560014
##                                                                            category
## 1                                                                       Album Notes
## 2 Album Of Best Original Score Written For A Motion Picture Or A Television Special
## 3                                                                 Album Of The Year
## 4                                          Album Of The Year (Other Than Classical)
## 5                                                     Album Of The Year - Classical
## 6                                                    Album Of The Year -- Classical
##   cluster
## 1       1
## 2       2
## 3       3
## 4       2
## 5       2
## 6       1
library(tidyverse)

k <- 4
award_features$cluster <- factor(cutree(hc, k = k))

cluster_summary <- award_features %>%
  group_by(cluster) %>%
  summarise(
    mean_nominations = mean(total_nominations),
    mean_wins = mean(total_wins),
    mean_win_rate = mean(win_rate),
    mean_years_active = mean(years_active),
    mean_unique_nominees = mean(unique_nominees),
    mean_most_freq_nominee_count = mean(most_frequent_nominee_count),
    mean_num_decades_active = mean(num_decades_active),
    mean_noms_per_year = mean(nominations_per_year),
    .groups = "drop"
  )

print(cluster_summary)
## # A tibble: 4 × 9
##   cluster mean_nominations mean_wins mean_win_rate mean_years_active
##   <fct>              <dbl>     <dbl>         <dbl>             <dbl>
## 1 1                   7.69      1.55         0.203              1.55
## 2 2                  11.6       1.89         0.162              1.89
## 3 3                 155.       30.1          0.196             30.1 
## 4 4                  51.2       9.88         0.194              9.88
## # ℹ 4 more variables: mean_unique_nominees <dbl>,
## #   mean_most_freq_nominee_count <dbl>, mean_num_decades_active <dbl>,
## #   mean_noms_per_year <dbl>
cluster_summary_ext <- award_features %>%
  group_by(cluster) %>%
  summarise(
    nominations_range = paste0(min(total_nominations), "–", max(total_nominations)),
    wins_range = paste0(min(total_wins), "–", max(total_wins)),
    years_active_range = paste0(min(years_active), "–", max(years_active)),
    .groups = "drop"
  )

print(cluster_summary_ext)
## # A tibble: 4 × 4
##   cluster nominations_range wins_range years_active_range
##   <fct>   <chr>             <chr>      <chr>             
## 1 1       2–30              1–6        1–6               
## 2 2       6–41              1–6        1–6               
## 3 3       67–364            13–67      13–67             
## 4 4       10–154            2–24       2–24