Set-up

Be sure to update your installation of compmus before running this vignette.

We will be using the developing tidymodels framework for integrating with the different machine-learning libraries in a consistent manner.

## ── Attaching packages ─────────────────────────────────────── tidyverse 1.3.2 ──
##  ggplot2 3.4.1      purrr   1.0.1
##  tibble  3.1.8      dplyr   1.1.0
##  tidyr   1.3.0      stringr 1.5.0
##  readr   2.1.4      forcats 1.0.0
## ── Conflicts ────────────────────────────────────────── tidyverse_conflicts() ──
##  dplyr::filter() masks stats::filter()
##  dplyr::lag()    masks stats::lag()
## ── Attaching packages ────────────────────────────────────── tidymodels 1.0.0 ──
##  broom        1.0.3      rsample      1.1.1
##  dials        1.1.0      tune         1.0.1
##  infer        1.0.4      workflows    1.1.2
##  modeldata    1.1.0      workflowsets 1.0.0
##  parsnip      1.0.3      yardstick    1.1.0
##  recipes      1.0.4     
## ── Conflicts ───────────────────────────────────────── tidymodels_conflicts() ──
##  scales::discard() masks purrr::discard()
##  dplyr::filter()   masks stats::filter()
##  recipes::fixed()  masks stringr::fixed()
##  dplyr::lag()      masks stats::lag()
##  yardstick::spec() masks readr::spec()
##  recipes::step()   masks stats::step()
##  Use suppressPackageStartupMessages() to eliminate package startup messages
## 
## Attaching package: 'spotifyr'
## 
## The following object is masked from 'package:yardstick':
## 
##     tidy
## 
## The following object is masked from 'package:rsample':
## 
##     tidy
## 
## The following object is masked from 'package:recipes':
## 
##     tidy
## 
## The following object is masked from 'package:parsnip':
## 
##     tidy
## 
## The following object is masked from 'package:broom':
## 
##     tidy
library(compmus)

In order for the code below to run, it is also necessary to set up Spotify login credentials for spotifyr.

Novelty Functions

For novelty functions, we want to work directly with the segments, and not summarise them at higher levels like Spotify’s own estimates of bar or beat.

pata_pata <- 
    get_tidy_audio_analysis('3uy90vHHATPjtdilshDQDt') %>% 
    select(segments) %>% unnest(segments)

We can compute an energy-based novelty function based on Spotify’s loudness estimates. The tempo of this piece is about 126 BPM: how well does this technique work?

pata_pata %>% 
    mutate(loudness_max_time = start + loudness_max_time) %>% 
    arrange(loudness_max_time) %>% 
    mutate(delta_loudness = loudness_max - lag(loudness_max)) %>% 
    ggplot(aes(x = loudness_max_time, y = pmax(0, delta_loudness))) +
    geom_line() +
    xlim(0, 30) +
    theme_minimal() +
    labs(x = 'Time (s)', y = 'Novelty')
## Warning: Removed 576 rows containing missing values (`geom_line()`).

We can use similar approaches for chromagrams and cepstrograms. In the case of chromagrams, Aitchison’s clr transformation gives more sensible differences between time points. Even with these helpful transformations, however, self-similarity matrices tend to be more helpful visualisations of chroma and timbre from the Spotify API.

pata_pata %>% 
    mutate(pitches = map(pitches, compmus_normalise, 'clr')) %>% 
    arrange(start) %>% 
    mutate(pitches = map2(pitches, lag(pitches), `-`)) %>% 
    slice(-1) %>% 
    compmus_gather_chroma %>% 
    ggplot(
        aes(
            x = start + duration / 2, 
            width = duration, 
            y = pitch_class, 
            fill = pmax(0, value))) + 
    geom_tile() +
    scale_fill_viridis_c(option = 'E', guide = 'none') +
    xlim(0, 30) +
    labs(x = 'Time (s)', y = NULL, fill = 'Magnitude') +
    theme_classic()
## Warning: Removed 6912 rows containing missing values (`geom_tile()`).

pata_pata %>% 
    arrange(start) %>% 
    mutate(timbre = map2(timbre, lag(timbre), `-`)) %>% 
    slice(-1) %>% 
    compmus_gather_timbre %>% 
    ggplot(
        aes(
            x = start + duration / 2, 
            width = duration, 
            y = basis, 
            fill = pmax(0, value))) + 
    geom_tile() +
    scale_fill_viridis_c(option = 'E', guide = 'none') +
    xlim(0, 30) +
    labs(x = 'Time (s)', y = NULL, fill = 'Magnitude') +
    theme_classic()
## Warning: Removed 6912 rows containing missing values (`geom_tile()`).

Find a Spotify track that has a regular tempo but lacks percussion (e.g., much Western classical music), and compute the above three representations. How do they differ from what you see for ‘Pata Pata’?

Tempograms

Spotify does not make the novelty function underlying their own tempo analysis available to the public, but we can still use onsets of every segment to generate Fourier tempograms. The tempogram() function from compmus generates this automatically from an audio analysis, ready to plot with geom_raster (a faster version of geom_tile for when every segment has the same length). Here is an example of ‘Samba do outro lugar’, a track from the Brazilian indie band Graveola that features several tempo and metre alternations.

graveola <- get_tidy_audio_analysis('6PJasPKAzNLSOzxeAH33j2')
graveola %>% 
    tempogram(window_size = 8, hop_size = 1, cyclic = FALSE) %>% 
    ggplot(aes(x = time, y = bpm, fill = power)) + 
    geom_raster() + 
    scale_fill_viridis_c(guide = 'none') +
    labs(x = 'Time (s)', y = 'Tempo (BPM)') +
    theme_classic()

The textbook notes that Fourier-based tempograms tend to pick up strongly on tempo harmonics. Wrapping into a cyclic tempogram can be more informative.

graveola %>% 
    tempogram(window_size = 8, hop_size = 1, cyclic = TRUE) %>% 
    ggplot(aes(x = time, y = bpm, fill = power)) + 
    geom_raster() + 
    scale_fill_viridis_c(guide = 'none') +
    labs(x = 'Time (s)', y = 'Tempo (BPM)') +
    theme_classic()

Classification

In order to demonstrate some of the principles of classification, we will try to identify some of the features that Spotify uses to designate playlists as ‘workout’ playlists. For a full analysis, we would need to delve deeper, but let’s start with a comparison of three playlists: Indie Pop, Indie Party, and Indie Running. For speed, this example will work with only the first 20 songs from each playlist, but you should feel free to use more if your computer can handle it.

pop <- 
    get_playlist_audio_features('spotify', '37i9dQZF1DWWEcRhUVtL8n') %>% 
    slice(1:20) %>% 
    add_audio_analysis
party <- 
    get_playlist_audio_features('spotify', '37i9dQZF1DWTujiC7wfofZ') %>% 
    slice(1:20) %>% 
    add_audio_analysis
workout <- 
    get_playlist_audio_features('spotify', '37i9dQZF1DWZq91oLsHZvy') %>% 
    slice(1:20) %>% 
    add_audio_analysis

As you think about this lab session – and your portfolio – think about the four kinds of validity that Sturm and Wiggins discussed in our reading for this week. Do these projects have:

  • Statistical validity [somewhat beyond the scope of this course]?
  • Content validity?
  • Internal validity?
  • External validity?

We bind the three playlists together using the trick from Week 7, transpose the chroma vectors to a common tonic using the compmus_c_transpose function, and then summarise the vectors like we did when generating chromagrams and cepstrograms. Again, Aitchison’s clr transformation can help with chroma.

indie <- 
    pop %>% mutate(playlist = "Indie Pop") %>% 
    bind_rows(
        party %>% mutate(playlist = "Indie Party"),
        workout %>% mutate(playlist = "Indie x Running")) %>% 
    mutate(playlist = factor(playlist)) %>% 
    mutate(
        segments = 
            map2(segments, key, compmus_c_transpose)) %>% 
    mutate(
        pitches = 
            map(segments, 
                compmus_summarise, pitches, 
                method = 'mean', norm = 'manhattan'),
        timbre =
            map(
                segments,
                compmus_summarise, timbre,
                method = 'mean')) %>% 
    mutate(pitches = map(pitches, compmus_normalise, 'clr')) %>% 
    mutate_at(vars(pitches, timbre), map, bind_rows) %>% 
    unnest(cols = c(pitches, timbre))

Pre-processing

In the tidyverse approach, we can preprocess data with a recipe specifying what we are predicting and what variables we think might be useful for that prediction. Then we use step functions to do any data clean (usually centering and scaling, but step_range is a viable alternative that squeezes everything to be between 0 and 1). Finally we prep and juice the data.

indie_class <- 
    recipe(playlist ~
               danceability +
               energy +
               loudness +
               speechiness +
               acousticness +
               instrumentalness +
               liveness +
               valence +
               tempo +
               track.duration_ms +
               C + `C#|Db` + D + `D#|Eb` +
               E + `F` + `F#|Gb` + G +
               `G#|Ab` + A + `A#|Bb` + B +
               c01 + c02 + c03 + c04 + c05 + c06 +
               c07 + c08 + c09 + c10 + c11 + c12,
           data = indie) %>% 
    step_center(all_predictors()) %>%
    step_scale(all_predictors()) %>%
    # step_range(all_predictors()) %>% 
    prep(indie) %>% 
    juice

Cross-Validation

The vfold_cv function sets up cross-validation. We will use 5-fold cross-validation here in the interest of spped, but 10-fold cross-validation is more typical.

indie_cv <- indie_class %>% vfold_cv(5)

Classification Algorithms

Your DataCamp tutorials this week introduced four classical algorithms for classification: \(k\)-nearest neighbour, naive Bayes, logistic regression, and decision trees. Other than naive Bayes, all of them can be implemented more simply in tidymodels. In order to use cross-validation, however, we need to write some local helper functions to fit the classifier on the training sets, predict the labels for the test/validation sets, and bind the results to the original data.

\(k\)-Nearest Neighbour

A \(k\)-nearest neighbour classifier often works just fine with only one neighbour. It is very sensitive to the choice of features, however. Let’s check the performance as a baseline and come back to it later.

indie_knn <- 
  nearest_neighbor(mode = 'classification', neighbors = 1) %>% 
  set_engine('kknn')
predict_knn <- function(split)
    fit(indie_knn, playlist ~ ., data = analysis(split)) %>% 
    predict(assessment(split), type = 'class') %>%
    bind_cols(assessment(split))

After a little awkwardness with cross-validation, we can use conf_mat to get a confusion matrix.

indie_cv %>% 
    mutate(pred = map(splits, predict_knn)) %>% unnest(pred) %>% 
    conf_mat(truth = playlist, estimate = .pred_class)
##                  Truth
## Prediction        Indie Party Indie Pop Indie x Running
##   Indie Party               7         8               6
##   Indie Pop                 4        10               7
##   Indie x Running           9         2               7

These matrices autoplot in two forms.

indie_cv %>% 
    mutate(pred = map(splits, predict_knn)) %>% unnest(pred) %>% 
    conf_mat(truth = playlist, estimate = .pred_class) %>% 
    autoplot(type = 'mosaic')

indie_cv %>% 
    mutate(pred = map(splits, predict_knn)) %>% unnest(pred) %>% 
    conf_mat(truth = playlist, estimate = .pred_class) %>% 
    autoplot(type = 'heatmap')

We can also compute statistics like accuracy, Cohen’s kappa, or the J-measure.

indie_cv %>% 
    mutate(pred = map(splits, predict_knn)) %>% unnest(pred) %>% 
    metric_set(accuracy, kap, j_index)(truth = playlist, estimate = .pred_class)
## # A tibble: 3 × 3
##   .metric  .estimator .estimate
##   <chr>    <chr>          <dbl>
## 1 accuracy multiclass       0.4
## 2 kap      multiclass       0.1
## 3 j_index  macro            0.1

Logistic and Multinomial Regression

In the two-class case, we use logistic regression, but beware if you have more than two classes! R will just build a classifier for the first two without warning.

indie_logistic <- logistic_reg() %>% set_engine('glm')
predict_logistic <- function(split)
    fit(indie_logistic, playlist ~ ., data = analysis(split)) %>% 
    predict(assessment(split), type = 'class') %>%
    bind_cols(assessment(split))

With three or more classes, we need multinomial regression instead. You can adjust the penalty parameter if you are feeling adventurous.

indie_multinom <- multinom_reg(penalty = 0.1) %>% set_engine('glmnet')
predict_multinom <- function(split)
    fit(indie_multinom, playlist ~ ., data = analysis(split)) %>% 
    predict(assessment(split), type = 'class') %>%
    bind_cols(assessment(split))

It is not a strong classifier for this problem.

indie_cv %>% 
    mutate(pred = map(splits, predict_multinom)) %>% unnest(pred) %>% 
    metric_set(accuracy, kap, j_index)(truth = playlist, estimate = .pred_class)
## # A tibble: 3 × 3
##   .metric  .estimator .estimate
##   <chr>    <chr>          <dbl>
## 1 accuracy multiclass     0.467
## 2 kap      multiclass     0.2  
## 3 j_index  macro          0.200

We can look at the most important features in the model by using the coef method.

indie_class %>% 
    fit(indie_multinom, playlist ~ ., data = .) %>% 
    pluck('fit') %>%
    coef
## $`Indie Party`
## 35 x 100 sparse Matrix of class "dgCMatrix"
##   [[ suppressing 100 column names 's0', 's1', 's2' ... ]]
##                                                                             
##                   5.20417e-17 0.000760391 0.00257862 0.004960463 0.007456988
## danceability      .           .           .          .           .          
## energy            .           .           .          .           .          
## loudness          .           .           .          .           .          
## speechiness       .           .           .          .           .          
## acousticness      .           .           .          .           .          
## instrumentalness  .           .           .          .           .          
## liveness          .           .           .          .           .          
## valence           .           .           .          .           .          
## tempo             .           .           .          .           .          
## track.duration_ms .           .           .          .           .          
## C                 .           .           .          .           .          
## `C#|Db`           .           .           .          .           .          
## D                 .           .           .          .           .          
## `D#|Eb`           .           .           .          .           .          
## E                 .           .           .          .           .          
## F                 .           .           .          .           .          
## `F#|Gb`           .           .           .          .           .          
## G                 .           .           .          .           .          
## `G#|Ab`           .           .           .          .           .          
## A                 .           .           .          .           .          
## `A#|Bb`           .           .           .          .           .          
## B                 .           .           .          .           .          
## c01               .           .           .          .           .          
## c02               .           .           .          .           .          
## c03               .           .           .          .           .          
## c04               .           .           .          .           .          
## c05               .           .           .          .           .          
## c06               .           .           .          .           .          
## c07               .           .           .          .           .          
## c08               .           .           .          .           .          
## c09               .           .           .          .           .          
## c10               .           .           .          .           .          
## c11               .           .           .          .           .          
## c12               .           .           .          .           .          
##                                                                        
##                   0.009962983 0.01240122 0.0146692 0.0167831 0.01882878
## danceability      .           .          .         .         .         
## energy            .           .          .         .         .         
## loudness          .           .          .         .         .         
## speechiness       .           .          .         .         .         
## acousticness      .           .          .         .         .         
## instrumentalness  .           .          .         .         .         
## liveness          .           .          .         .         .         
## valence           .           .          .         .         .         
## tempo             .           .          .         .         .         
## track.duration_ms .           .          .         .         .         
## C                 .           .          .         .         .         
## `C#|Db`           .           .          .         .         .         
## D                 .           .          .         .         .         
## `D#|Eb`           .           .          .         .         .         
## E                 .           .          .         .         .         
## F                 .           .          .         .         .         
## `F#|Gb`           .           .          .         .         .         
## G                 .           .          .         .         .         
## `G#|Ab`           .           .          .         .         .         
## A                 .           .          .         .         .         
## `A#|Bb`           .           .          .         .         .         
## B                 .           .          .         .         .         
## c01               .           .          .         .         .         
## c02               .           .          .         .         .         
## c03               .           .          .         .         .         
## c04               .           .          .         .         .         
## c05               .           .          .         .         .         
## c06               .           .          .         .         .         
## c07               .           .          .         .         .         
## c08               .           .          .         .         .         
## c09               .           .          .         .         .         
## c10               .           .          .         .         .         
## c11               .           .          .         .         .         
## c12               .           .          .         .         .         
##                                                                           
##                   0.02076141 0.0241273  0.02902415  0.03363323  0.03859974
## danceability      .          .          .           .           .         
## energy            .          .          .           .           .         
## loudness          .          .          .           .           .         
## speechiness       .          .          .           .           .         
## acousticness      .          .          .           .           .         
## instrumentalness  .          .          .           .           .         
## liveness          .          .          .           .           .         
## valence           .          .          .           0.02473563  0.06302270
## tempo             .          .          .          -0.03148336 -0.06633460
## track.duration_ms .          .          .           .           .         
## C                 .          .          .           .           .         
## `C#|Db`           .          .          .           .           .         
## D                 .          .          .           .           .         
## `D#|Eb`           .          .          .           .           .         
## E                 .          .          .           .           .         
## F                 .          .          .           .           .         
## `F#|Gb`           .          .          .           .           .         
## G                 .          .          .           .           .         
## `G#|Ab`           .          .          .           .           .         
## A                 .          .          .           .           .         
## `A#|Bb`           .          .          .           .           .         
## B                 .          .          .           .           .         
## c01               .          .          .           .           .         
## c02               .          .          .           .           .         
## c03               .          .          .           .           .         
## c04               .          .          .           .           .         
## c05               .          .          .           .           .         
## c06               .          .          .           .           .         
## c07               .          .          .           .           .         
## c08               .          .         -0.01325518 -0.04923931 -0.07283337
## c09               .          .          .           .           .         
## c10               .          .          .           .           .         
## c11               .          .          .           .           .         
## c12               .          .          .           .           .         
##                                                                               
##                    0.04526595  0.05264265  0.06032010  0.06883695  0.076955031
## danceability       .           .           .           .           .          
## energy             .           .           .           .           .          
## loudness           .           .           .           .           .          
## speechiness        .          -0.02004787 -0.06187908 -0.09657563 -0.130790913
## acousticness       .           .           .           .           .          
## instrumentalness   .           .           .           .           .          
## liveness           .           .           .           .           .          
## valence            0.10433796  0.14478263  0.17897670  0.20610454  0.223966695
## tempo             -0.09331544 -0.11562249 -0.13736480 -0.14793782 -0.139824109
## track.duration_ms  .           .           .           .           .          
## C                  .           .           .           .           .          
## `C#|Db`            .           .           .           .           .          
## D                  .           .           .           .           .          
## `D#|Eb`            .           .           .           .           .          
## E                  .           .           .           .           .          
## F                  .           .           .           0.02380555  0.045021747
## `F#|Gb`            .           .           .           .           .          
## G                  .           .           .           .           .          
## `G#|Ab`            .           .           .           .           .          
## A                  .           .           .           .           .          
## `A#|Bb`            .           .           .           .           .          
## B                  .           .           .           .           .          
## c01                .           .           .           .           .          
## c02                .           .           .           .           .          
## c03                .           .           .           .           .          
## c04                .           .           .           .           .          
## c05                .           .           .           .           .          
## c06                .           .           .           .          -0.001251385
## c07                .           .           .           .           .          
## c08               -0.08907508 -0.09688449 -0.10077433 -0.10550481 -0.105892828
## c09                .           .           .           .           .          
## c10                .           .           .           .           .          
## c11                .           .           .           .           .          
## c12                .           .           .           .           .          
##                                                                                
##                    0.08253009  0.08690710  0.08977454  0.0915495449  0.09141662
## danceability       .           .           .           .             .         
## energy             .           .           .           .             .         
## loudness           .           .           .           .             .         
## speechiness       -0.15243861 -0.17358574 -0.19585507 -0.2160258414 -0.22812666
## acousticness       .           .           .           .             .         
## instrumentalness   .           .           .           .             .         
## liveness           .           .           .           .             .         
## valence            0.23834481  0.25210153  0.26841207  0.2795681187  0.30693181
## tempo             -0.13400413 -0.13233581 -0.13538534 -0.1381373560 -0.14059302
## track.duration_ms  .           .           .           .             .         
## C                  .           .           .           .             .         
## `C#|Db`            0.01811949  0.04749485  0.08195455  0.1122953759  0.12816306
## D                  .           .           .           .             .         
## `D#|Eb`            .           .           .           .             .         
## E                  .           .           .           .             .         
## F                  0.07454818  0.10559583  0.13820351  0.1751235508  0.21545458
## `F#|Gb`            .           .           .           .             .         
## G                  .           .           .          -0.0006352606 -0.02176743
## `G#|Ab`            .           .           .           .             .         
## A                  .           .           .           .             .         
## `A#|Bb`            .           .           .           .             .         
## B                  .           .           .           .             .         
## c01                .           .           .           .             .         
## c02                .           .           .           0.0158887900  0.03909837
## c03                .           .           .           .             .         
## c04                .           .           .           .             .         
## c05                .           .           .           .             .         
## c06               -0.03579222 -0.06829282 -0.09934997 -0.1331684729 -0.17732821
## c07                .           .           .           .             .         
## c08               -0.10020763 -0.09376658 -0.08751022 -0.0836446224 -0.08308611
## c09                .           .           .           .             .         
## c10                .           .           .           .             .         
## c11                .           .           .           .             .         
## c12                .           .           .          -0.0009057187 -0.02645372
##                                                                              
##                    0.10155188  0.11603201  0.13362779  0.15144368  0.16974346
## danceability       .           .           .           .           .         
## energy             .           .           .           .           .         
## loudness           .           .           .           .           .         
## speechiness       -0.23618297 -0.25138807 -0.27343975 -0.31256532 -0.35479047
## acousticness       .           .           .           .           .         
## instrumentalness   .           .           .           .           .         
## liveness           .           .           .           .           .         
## valence            0.33626659  0.37526171  0.40783511  0.43865154  0.46981837
## tempo             -0.14141608 -0.13547429 -0.13135281 -0.12436695 -0.12539701
## track.duration_ms  .           .           .           .           .         
## C                  .           .           .           .           .         
## `C#|Db`            0.13471029  0.13438917  0.13978435  0.13374542  0.12416621
## D                  .           .           .           .           .         
## `D#|Eb`            .           .           .           .           .         
## E                  .           .           .           .           .         
## F                  0.25653382  0.30058935  0.35409298  0.40818853  0.45865320
## `F#|Gb`            .           .           .           .           .         
## G                 -0.05314522 -0.07271830 -0.08024478 -0.08592074 -0.09153696
## `G#|Ab`            .           .           .           .           .         
## A                  .           .           .           .           .         
## `A#|Bb`            .           .           .           .           .         
## B                  .           .           .           .           .         
## c01                .           .           .           .           .         
## c02                0.09937815  0.13169452  0.14416026  0.16315048  0.18102370
## c03                .           .           .          -0.09054841 -0.19532748
## c04                .           0.05424187  0.13717854  0.25130975  0.36593443
## c05                .           .           .           .           .         
## c06               -0.23844567 -0.28290542 -0.31976340 -0.35578901 -0.38937152
## c07                .           .           .           .           .         
## c08               -0.07748102 -0.07646327 -0.07598720 -0.06497406 -0.05692502
## c09                .           .           .           .           .         
## c10                .          -0.01791811 -0.02649791 -0.02584033 -0.02725807
## c11                .           .           .           .           .         
## c12               -0.05336911 -0.07547844 -0.09563942 -0.11659967 -0.13512676
##                                                                                
##                    0.1909060291  0.21501150  0.24194460  0.27072495  0.30081184
## danceability       .             .           .           .           .         
## energy             .             .           .           .           .         
## loudness           .             .           .           .           .         
## speechiness       -0.3912646833 -0.42683022 -0.45147132 -0.46719149 -0.48050313
## acousticness       .             .           .           .           .         
## instrumentalness   .             .           .           .           .         
## liveness           .             .           .           .           .         
## valence            0.5062519788  0.53773190  0.56781441  0.61750013  0.64926104
## tempo             -0.1455474288 -0.16689049 -0.18675131 -0.21226837 -0.24015410
## track.duration_ms  .             .           .           .           .         
## C                  .             .           .           .           .         
## `C#|Db`            0.1034451584  0.07599871  0.04483096  .           .         
## D                  .             .           .           .           .         
## `D#|Eb`            .             .           .           .           .         
## E                  .             .           .           .           .         
## F                  0.4985519409  0.53346626  0.57865624  0.62708891  0.69561887
## `F#|Gb`            .             .           .           .           .         
## G                 -0.1046566278 -0.12587683 -0.16512176 -0.22128862 -0.24111415
## `G#|Ab`            .             .           .           .           .         
## A                  .             .           .           .           .         
## `A#|Bb`            .             .           .           .           .         
## B                 -0.0007378244 -0.02020071 -0.07063203 -0.12650729 -0.16153262
## c01                .             .           .           .           .         
## c02                0.2066094214  0.22638088  0.28710378  0.36760739  0.42909292
## c03               -0.3052113619 -0.42222882 -0.53476036 -0.65629337 -0.75317544
## c04                0.4710802815  0.57512137  0.67204337  0.76791722  0.86128595
## c05                .             .           .           .           .         
## c06               -0.4241851032 -0.45863232 -0.51449413 -0.57246548 -0.62195773
## c07                .             .           .           .           .         
## c08               -0.0555932733 -0.05054475 -0.04256031 -0.03545988 -0.02805626
## c09                .             .           0.06377895  0.14726331  0.22293163
## c10               -0.0343104940 -0.03911347 -0.05199078 -0.08293908 -0.09948498
## c11                .             .           .           .           .         
## c12               -0.1505669755 -0.17007928 -0.18810690 -0.20973497 -0.23031167
##                                                                                
##                    0.33538261  0.374383550  0.413882860  0.45356121  0.49327390
## danceability       .           .            .            .           .         
## energy             .           .            .            .           .         
## loudness           .           .            .            .           .         
## speechiness       -0.49218620 -0.498325978 -0.510674474 -0.52909758 -0.54559109
## acousticness       .           .            .            .           .         
## instrumentalness   .           .            .            .           .         
## liveness           .           .            .            .           .         
## valence            0.66040595  0.685451367  0.717050997  0.72652322  0.73022409
## tempo             -0.26555106 -0.286613346 -0.305883828 -0.33620146 -0.37726651
## track.duration_ms  .           0.031983224  0.102829867  0.17546613  0.24839518
## C                  .           .            .            .           .         
## `C#|Db`            .           .            .            .           .         
## D                  .           .            .            .           .         
## `D#|Eb`            .           .            .            .           .         
## E                  .           .            .            .           .         
## F                  0.76159778  0.835956314  0.922250344  1.00826094  1.09744021
## `F#|Gb`            .           .            .            .           .         
## G                 -0.25666128 -0.274321087 -0.290380224 -0.30271067 -0.31882338
## `G#|Ab`            .           .            .            .           .         
## A                  .           .            .            .           .         
## `A#|Bb`            .           .            .            .           .         
## B                 -0.18972834 -0.218079402 -0.231917019 -0.22863019 -0.21973279
## c01                .           .            0.007874561  0.05193910  0.09924219
## c02                0.48901105  0.543183161  0.611296562  0.70047723  0.79366256
## c03               -0.82355103 -0.909919726 -1.031661041 -1.17989700 -1.35315677
## c04                0.92966606  1.012535672  1.128069620  1.25938821  1.41358350
## c05                .           .            .            .           .         
## c06               -0.67361970 -0.726721488 -0.772886782 -0.81051421 -0.84349104
## c07                .           .            .            .           .         
## c08               -0.02054041 -0.007729012  .            .           .         
## c09                0.28575640  0.352613874  0.421976807  0.48424863  0.55228862
## c10               -0.11196166 -0.109645542 -0.085926990 -0.05967879 -0.02414164
## c11                .           .            .            .           .         
## c12               -0.24817965 -0.267157624 -0.291471889 -0.31860325 -0.34968550
##                                                                       
##                    0.5269279  0.5620802692  0.6023573891  0.6450891357
## danceability       .          .             .             .           
## energy             .          .             .             .           
## loudness           .          .             .             .           
## speechiness       -0.5654333 -0.6042670660 -0.6555409685 -0.7107519408
## acousticness       .          .             .             .           
## instrumentalness   .          .             .             .           
## liveness           .          .             .             .           
## valence            0.7212791  0.7086389943  0.7175898328  0.7310152132
## tempo             -0.4223792 -0.4593336675 -0.4803182449 -0.4943282539
## track.duration_ms  0.3104240  0.3585791769  0.4034105620  0.4454152687
## C                  .         -0.0009741221 -0.0000236621  .           
## `C#|Db`            .          .             .             .           
## D                  .          .             .             .           
## `D#|Eb`            .          .             .             .           
## E                  .          .             .             .           
## F                  1.1807407  1.2593383599  1.3445493026  1.4320173941
## `F#|Gb`            .          .             .             .           
## G                 -0.3438119 -0.3605060523 -0.3679968592 -0.3732752451
## `G#|Ab`            .          .             .             0.0002084047
## A                  .          .             .             .           
## `A#|Bb`            .          .             .             .           
## B                 -0.2191180 -0.2322837773 -0.2593839884 -0.2889051025
## c01                0.1497103  0.1921882221  0.2341050884  0.2742941887
## c02                0.8981476  0.9900123832  1.0651844684  1.1367806176
## c03               -1.5519175 -1.7345199315 -1.8732121175 -1.9987068816
## c04                1.5787468  1.7268492446  1.8287643128  1.9175203793
## c05                .          .             .             .           
## c06               -0.8893112 -0.9366546688 -0.9678668935 -0.9950096291
## c07                .          .             .             .           
## c08                .          .             .             .           
## c09                0.6312097  0.7067233701  0.7515398060  0.7917669622
## c10                .          .             .             .           
## c11                .          .             .             .           
## c12               -0.3846070 -0.4205166190 -0.4662999266 -0.5144498970
##                                                                                
##                    0.68554106  0.72550171  0.768199597  0.810328457  0.85268144
## danceability       .           .           .            .            .         
## energy             .           .           0.001017284  0.015426055  0.02243309
## loudness           .           .           .            .            .         
## speechiness       -0.79095225 -0.89041164 -0.984509478 -1.051120956 -1.07490329
## acousticness       .           .           .            .            .         
## instrumentalness   .           .           .            .            .         
## liveness           .           .           .            .            .         
## valence            0.75119284  0.77606510  0.807189627  0.848836624  0.89517040
## tempo             -0.50969961 -0.52010841 -0.534744011 -0.570281110 -0.61790222
## track.duration_ms  0.50545386  0.58570741  0.671475338  0.754689733  0.83166487
## C                  .           .           .            .            .         
## `C#|Db`            .           .           .            .            .         
## D                  .           .           .            .            .         
## `D#|Eb`            .           .           .            .            .         
## E                  .           .           .            .            .         
## F                  1.52899759  1.63532674  1.735255096  1.841053181  1.93867791
## `F#|Gb`            0.03926604  0.12352642  0.218201433  0.292181261  0.34701494
## G                 -0.39917760 -0.44678817 -0.502448133 -0.592564664 -0.69095074
## `G#|Ab`            0.02753488  0.06603381  0.101266604  0.150256802  0.19412943
## A                  0.01804620  0.10180113  0.200573345  0.292894105  0.36487465
## `A#|Bb`            .           .           .            .            .         
## B                 -0.29119019 -0.26937171 -0.241751583 -0.212597566 -0.18014000
## c01                0.31808853  0.36433666  0.409083729  0.444965839  0.49104498
## c02                1.21625575  1.29927759  1.381431104  1.501810731  1.63866516
## c03               -2.12337978 -2.26015810 -2.401327840 -2.563741103 -2.73202506
## c04                1.99418514  2.06278068  2.134365725  2.189692014  2.24653550
## c05                .           .          -0.011473277 -0.002948721  .         
## c06               -1.02157154 -1.04499536 -1.077715819 -1.105647646 -1.13354272
## c07                .           .           .            .            .         
## c08                .           .           .            .            .         
## c09                0.83856824  0.89158298  0.952002104  1.033529076  1.12435111
## c10                .           .           .            .            .         
## c11                .           .           .            0.038713027  0.12203148
## c12               -0.55266932 -0.58039380 -0.606399527 -0.633860231 -0.66720805
##                                                                                
##                    0.89788920  0.94424051  0.9908032525  1.03880271  1.08649849
## danceability       .           .          -0.0008875097 -0.02503944 -0.05395207
## energy             0.02782324  0.03424012  0.0425483985  0.05157526  0.06161927
## loudness           .           .           .             .           .         
## speechiness       -1.08285989 -1.08256837 -1.0763558056 -1.06628096 -1.05550387
## acousticness       .           .           .             .           .         
## instrumentalness   .           .           .             .           .         
## liveness           .           .           .             .           .         
## valence            0.94617622  1.00097368  1.0591833281  1.12957640  1.20189422
## tempo             -0.67281798 -0.73216567 -0.7934401985 -0.85243555 -0.90786570
## track.duration_ms  0.90069285  0.96102786  1.0143511981  1.06670946  1.12006720
## C                  .           .           .             .           .         
## `C#|Db`            .           .           .             .           .         
## D                  .           .           .             .           .         
## `D#|Eb`            .           .           .             .           .         
## E                  .           .           .             .           .         
## F                  2.02557302  2.10449423  2.1769365717  2.24920344  2.32517886
## `F#|Gb`            0.38518070  0.40900282  0.4206986476  0.42713462  0.43351192
## G                 -0.79636406 -0.91008626 -1.0301514841 -1.14652080 -1.25639634
## `G#|Ab`            0.22759111  0.25382321  0.2723871933  0.28616905  0.30030207
## A                  0.41518949  0.44613619  0.4605198614  0.47376855  0.48859320
## `A#|Bb`            .           .           .             .           .         
## B                 -0.16276753 -0.15931453 -0.1686438210 -0.18678836 -0.20375861
## c01                0.53498679  0.57451487  0.6094633683  0.64037483  0.67055413
## c02                1.78307935  1.93526755  2.0942961798  2.24564357  2.38972342
## c03               -2.89029910 -3.03568779 -3.1729426553 -3.31583328 -3.46068095
## c04                2.30413128  2.35942643  2.4155375288  2.48022389  2.54759351
## c05                .           .           .             .           .         
## c06               -1.17086411 -1.21723682 -1.2720872150 -1.32521253 -1.37505899
## c07                .           .           .             .           .         
## c08                .           .           .             .           .         
## c09                1.21571866  1.30615296  1.3946208558  1.48833665  1.58274234
## c10                .           .           .             .           .         
## c11                0.20820495  0.29334259  0.3769931364  0.45643983  0.53582185
## c12               -0.70667085 -0.74976777 -0.7963702891 -0.84556999 -0.89519467
##                                                                               
##                    1.13392816  1.18089770  1.228481529  1.27925582  1.33164455
## danceability      -0.08320566 -0.11267683 -0.141392304 -0.17323863 -0.20440254
## energy             0.07187127  0.08187032  0.092132980  0.10589246  0.11676337
## loudness           .           .           .            .           .         
## speechiness       -1.04404007 -1.03284141 -1.019858463 -1.00456238 -0.98857692
## acousticness       .           .           .            .           .         
## instrumentalness   .           .           .            .           .         
## liveness           .           .           .            .           .         
## valence            1.27468223  1.34701589  1.419020248  1.49515239  1.57153652
## tempo             -0.96177115 -1.01315562 -1.063993367 -1.11743611 -1.16763891
## track.duration_ms  1.17298688  1.22686453  1.278530822  1.32276900  1.36577438
## C                  .           .           .            .           .         
## `C#|Db`            .           .           .            .           .         
## D                  .           .           .            .           .         
## `D#|Eb`            .           .           .            .           .         
## E                  .           .           .            .           .         
## F                  2.40276635  2.48351296  2.564803778  2.64538808  2.72657516
## `F#|Gb`            0.43835332  0.44439878  0.447093675  0.44344138  0.44037044
## G                 -1.36338984 -1.46585168 -1.568085327 -1.67770843 -1.78430844
## `G#|Ab`            0.31418302  0.32932967  0.343978974  0.36245579  0.38107632
## A                  0.50212730  0.51830216  0.529797827  0.52912097  0.53038017
## `A#|Bb`            .           .           .            .           .         
## B                 -0.22157491 -0.23699156 -0.255515768 -0.28114629 -0.30831841
## c01                0.70002249  0.73006000  0.760646190  0.78547462  0.81038152
## c02                2.53009504  2.66543729  2.798519699  2.93481251  3.06447135
## c03               -3.60413298 -3.74833962 -3.887798979 -4.00327528 -4.11401561
## c04                2.61604178  2.68565348  2.753457418  2.80617929  2.85472067
## c05                .           .           .            .           .         
## c06               -1.42460517 -1.47211195 -1.521485146 -1.57766018 -1.63150343
## c07                .           .           .            .           .         
## c08                .           .          -0.004983758 -0.02866656 -0.05328102
## c09                1.67600991  1.76791836  1.856415178  1.94376407  2.02852159
## c10                .           .           .            .           .         
## c11                0.61430248  0.69264361  0.767899968  0.83010578  0.88754910
## c12               -0.94527090 -0.99499824 -1.044325694 -1.09118058 -1.13685476
##                                                                          
##                    1.38465314  1.4377898  1.4908448  1.5434210  1.5955588
## danceability      -0.23428050 -0.2638965 -0.2934486 -0.3237848 -0.3548051
## energy             0.12640846  0.1338038  0.1398777  0.1455911  0.1515124
## loudness           .           .          .          .          .        
## speechiness       -0.97223154 -0.9553725 -0.9386944 -0.9229376 -0.9093009
## acousticness       .           .          .          .          .        
## instrumentalness   .           .          .          .          .        
## liveness           .           .          .          .          .        
## valence            1.64767176  1.7229229  1.7973857  1.8713964  1.9447142
## tempo             -1.21695369 -1.2646660 -1.3109573 -1.3557441 -1.3982705
## track.duration_ms  1.40714374  1.4486335  1.4903002  1.5324898  1.5753458
## C                  .           .          .          .          .        
## `C#|Db`            .           .          .          .          .        
## D                  .           .          .          .          .        
## `D#|Eb`            .           .          .          .          .        
## E                  .           .          .          .          .        
## F                  2.80724851  2.8894000  2.9728933  3.0577608  3.1441215
## `F#|Gb`            0.43526523  0.4300785  0.4245571  0.4190057  0.4134333
## G                 -1.89008166 -1.9923315 -2.0913029 -2.1870432 -2.2794657
## `G#|Ab`            0.39880160  0.4168202  0.4350922  0.4536046  0.4722069
## A                  0.52928245  0.5299043  0.5315452  0.5345145  0.5387421
## `A#|Bb`            .           .          .          .          .        
## B                 -0.33854997 -0.3684436 -0.3981747 -0.4275896 -0.4569624
## c01                0.83469171  0.8603628  0.8866423  0.9129338  0.9386525
## c02                3.19120498  3.3134219  3.4312490  3.5446931  3.6528979
## c03               -4.22124902 -4.3298080 -4.4394674 -4.5510320 -4.6637164
## c04                2.90197458  2.9504741  3.0004441  3.0525769  3.1068365
## c05                .           .          .          .          .        
## c06               -1.68556658 -1.7373068 -1.7869795 -1.8347453 -1.8804961
## c07                .           .          .          .          .        
## c08               -0.07834006 -0.1024910 -0.1258109 -0.1481043 -0.1695634
## c09                2.11124913  2.1926552  2.2731100  2.3529461  2.4320357
## c10                .           .          .          .          .        
## c11                0.94185406  0.9958069  1.0493732  1.1024511  1.1546212
## c12               -1.18236393 -1.2277613 -1.2731463 -1.3184657 -1.3637746
##                                                                         
##                    1.6476392  1.6991048  1.7527169  1.8048923  1.8566773
## danceability      -0.3853951 -0.4162815 -0.4430874 -0.4695521 -0.4959975
## energy             0.1562373  0.1605068  0.1617835  0.1610496  0.1601218
## loudness           .          .          .          .          .        
## speechiness       -0.8956596 -0.8868007 -0.8783038 -0.8772878 -0.8717563
## acousticness       .          .          .          .          .        
## instrumentalness   .          .          .          .          .        
## liveness           .          .          .          .          .        
## valence            2.0175441  2.0886794  2.1546908  2.2139339  2.2712974
## tempo             -1.4399661 -1.4775357 -1.5125976 -1.5419714 -1.5728857
## track.duration_ms  1.6184274  1.6620531  1.7039578  1.7461468  1.7884207
## C                  .          .          .          .          .        
## `C#|Db`            .          .          .          .          .        
## D                  .          .          .          .          .        
## `D#|Eb`            .          .          .          .          .        
## E                  .          .          .          .          .        
## F                  3.2316011  3.3201733  3.4101016  3.5023623  3.5972298
## `F#|Gb`            0.4077002  0.4045906  0.4019502  0.4051830  0.4033998
## G                 -2.3696745 -2.4560207 -2.5424747 -2.6222039 -2.7025679
## `G#|Ab`            0.4913729  0.5115030  0.5343111  0.5604455  0.5860661
## A                  0.5436480  0.5520896  0.5584726  0.5706768  0.5778180
## `A#|Bb`            .          .          .          .          .        
## B                 -0.4858079 -0.5124266 -0.5375495 -0.5543800 -0.5737994
## c01                0.9649194  0.9903998  1.0159707  1.0435608  1.0747102
## c02                3.7582349  3.8575564  3.9531521  4.0410255  4.1321401
## c03               -4.7764192 -4.8878146 -4.9922906 -5.0993365 -5.2173005
## c04                3.1617504  3.2169556  3.2730803  3.3349254  3.4061592
## c05                .          .          .          .          .        
## c06               -1.9247238 -1.9663110 -2.0072509 -2.0435395 -2.0811959
## c07                .          .          .          .          .        
## c08               -0.1903848 -0.2108611 -0.2273388 -0.2387901 -0.2469078
## c09                2.5102234  2.5860632  2.6572237  2.7223964  2.7887823
## c10                .          .          .          .          .        
## c11                1.2068874  1.2571135  1.3046547  1.3516989  1.4023676
## c12               -1.4090465 -1.4533701 -1.4962885 -1.5368083 -1.5783653
##                                                                             
##                    1.905440902  1.95581797  2.0046503  2.05292447  2.0990373
## danceability      -0.521845118 -0.54562780 -0.5681951 -0.58922030 -0.6108415
## energy             0.155607250  0.15313154  0.1516679  0.14887656  0.1464891
## loudness          -0.005186999 -0.02460552 -0.0536943 -0.08657872 -0.1251274
## speechiness       -0.869599525 -0.85563110 -0.8521103 -0.84467934 -0.8426546
## acousticness       .            .           .          .           .        
## instrumentalness   .            .           .          .           .        
## liveness           .            .           .          .           .        
## valence            2.322939575  2.37411060  2.4200221  2.46483337  2.5075685
## tempo             -1.599238695 -1.62958373 -1.6533788 -1.67812960 -1.6993541
## track.duration_ms  1.830980471  1.87625265  1.9202494  1.96549283  2.0105752
## C                  .            .           .          .           .        
## `C#|Db`            .            .           .          .           .        
## D                  .            .           .          .           .        
## `D#|Eb`            .            .           .          .           .        
## E                  .            .           .          .           .        
## F                  3.691798508  3.79091530  3.8891833  3.98801840  4.0857817
## `F#|Gb`            0.405541366  0.40256914  0.4044584  0.40192240  0.4025548
## G                 -2.774665173 -2.84954100 -2.9181216 -2.98696678 -3.0507613
## `G#|Ab`            0.612716962  0.63790919  0.6651991  0.69096526  0.7176874
## A                  0.588763279  0.59514398  0.6037520  0.60653940  0.6116923
## `A#|Bb`            .            .           .          .           .        
## B                 -0.585338170 -0.60511300 -0.6201419 -0.63803812 -0.6525811
## c01                1.116110488  1.16965464  1.2295747  1.29624643  1.3663923
## c02                4.219197933  4.31010480  4.3915251  4.47538853  4.5532012
## c03               -5.339920585 -5.47439584 -5.6012547 -5.73510250 -5.8673747
## c04                3.482248102  3.56668024  3.6502367  3.74101858  3.8324694
## c05                .            .           .          .           .        
## c06               -2.116586885 -2.15334038 -2.1872702 -2.22390497 -2.2585015
## c07                .            .           .          .           .        
## c08               -0.252861987 -0.25598341 -0.2607580 -0.26359555 -0.2668547
## c09                2.851798110  2.91961454  2.9821474  3.04551303  3.1061397
## c10                .            .           .          .           .        
## c11                1.453483655  1.50740686  1.5557125  1.60656801  1.6552942
## c12               -1.617407176 -1.65867009 -1.6958221 -1.73436406 -1.7710399
##                                                                         
##                    2.1450137  2.1893191  2.2324837  2.2740725  2.3169461
## danceability      -0.6322506 -0.6528941 -0.6750985 -0.6977531 -0.7198578
## energy             0.1443191  0.1425494  0.1406243  0.1391378  0.1406581
## loudness          -0.1684490 -0.2131091 -0.2613486 -0.3117375 -0.3618286
## speechiness       -0.8451539 -0.8497998 -0.8557574 -0.8647719 -0.8710250
## acousticness       .          .          .          .          .        
## instrumentalness   .          .          .          .          .        
## liveness           .          .          .          .          .        
## valence            2.5474888  2.5878277  2.6270056  2.6668034  2.7074532
## tempo             -1.7181461 -1.7354207 -1.7511053 -1.7649918 -1.7791523
## track.duration_ms  2.0564152  2.1034685  2.1511505  2.2002155  2.2509952
## C                  .          .          .          .          .        
## `C#|Db`            .          .          .          .          .        
## D                  .          .          .          .          .        
## `D#|Eb`            .          .          .          .          .        
## E                  .          .          .          .          .        
## F                  4.1854160  4.2862044  4.3866872  4.4878047  4.5911464
## `F#|Gb`            0.4046951  0.4059555  0.4092018  0.4127410  0.4129880
## G                 -3.1107142 -3.1688902 -3.2228146 -3.2733817 -3.3250556
## `G#|Ab`            0.7451438  0.7727938  0.8004933  0.8281741  0.8541016
## A                  0.6180645  0.6234392  0.6312006  0.6398300  0.6435274
## `A#|Bb`            .          .          .          .          .        
## B                 -0.6650330 -0.6779714 -0.6881325 -0.6966140 -0.7087351
## c01                1.4412041  1.5175716  1.5970361  1.6787116  1.7605478
## c02                4.6276653  4.7001416  4.7699655  4.8378330  4.9054817
## c03               -5.9997323 -6.1324075 -6.2670627 -6.4033117 -6.5425428
## c04                3.9258011  4.0208495  4.1176571  4.2157588  4.3173500
## c05                .          .          .          .          .        
## c06               -2.2901963 -2.3210033 -2.3501633 -2.3774745 -2.4059522
## c07                .          .          .          .          .        
## c08               -0.2708357 -0.2749826 -0.2787066 -0.2829295 -0.2855870
## c09                3.1660501  3.2251628  3.2837407  3.3427723  3.4035127
## c10                .          .          .          .          .        
## c11                1.7038308  1.7526290  1.8018932  1.8519567  1.9040342
## c12               -1.8067093 -1.8423405 -1.8773776 -1.9124405 -1.9489633
##                                                                              
##                    2.3579778  2.3986304  2.4394187  2.4809624476  2.522420385
## danceability      -0.7437478 -0.7678226 -0.7934948 -0.8187048870 -0.842457384
## energy             0.1425318  0.1456014  0.1512468  0.1599912560  0.170549078
## loudness          -0.4121316 -0.4647647 -0.5186497 -0.5688648555 -0.612182469
## speechiness       -0.8834553 -0.8938680 -0.8973494 -0.9000937919 -0.900912053
## acousticness       .          .          .          .             .          
## instrumentalness   .          .          .          .             .          
## liveness           .          .          .          .             .          
## valence            2.7470867  2.7886882  2.8307923  2.8738538902  2.918763974
## tempo             -1.7896740 -1.8004361 -1.8116523 -1.8226036292 -1.836748665
## track.duration_ms  2.3001956  2.3521814  2.4033858  2.4517654270  2.498830983
## C                  .          .          .          .             .          
## `C#|Db`            .          .          .          .             .          
## D                  .          .          .          .             .          
## `D#|Eb`            .          .          .          .             .          
## E                  .          .          .          .             .          
## F                  4.6908598  4.7946732  4.8976528  5.0003545705  5.104064851
## `F#|Gb`            0.4162678  0.4168681  0.4157612  0.4147381793  0.413920189
## G                 -3.3702167 -3.4174146 -3.4623503 -3.5024433281 -3.541849755
## `G#|Ab`            0.8798387  0.9067272  0.9315934  0.9555554043  0.979489994
## A                  0.6517616  0.6566614  0.6609206  0.6683922934  0.676358699
## `A#|Bb`            .          .          .          .             .          
## B                 -0.7170965 -0.7281616 -0.7414309 -0.7532903597 -0.764413519
## c01                1.8393344  1.9229192  2.0051371  2.0798065138  2.149415276
## c02                4.9669865  5.0298449  5.0888528  5.1397464216  5.185507778
## c03               -6.6750297 -6.8141074 -6.9538661 -7.0884239747 -7.220937653
## c04                4.4128963  4.5143608  4.6147467  4.7099646715  4.804372736
## c05                .          .          .         -0.0001158207 -0.005083826
## c06               -2.4316989 -2.4585710 -2.4846313 -2.5055361292 -2.526424016
## c07                .          .          .          .             .          
## c08               -0.2904988 -0.2940053 -0.2961729 -0.2951707204 -0.296918442
## c09                3.4600907  3.5201579  3.5796941  3.6359117907  3.691248403
## c10                .          .          .          .             .          
## c11                1.9519212  2.0030008  2.0539782  2.1051345453  2.158244709
## c12               -1.9830702 -2.0190486 -2.0545738 -2.0881055440 -2.122563586
##                                                                              
##                    2.5627021  2.60204775  2.64257020  2.683319940  2.72429000
## danceability      -0.8657524 -0.88797181 -0.90745433 -0.923485396 -0.93961312
## energy             0.1811971  0.19279810  0.20751404  0.223517287  0.23970045
## loudness          -0.6545733 -0.69414154 -0.72911177 -0.757829561 -0.78671782
## speechiness       -0.9019425 -0.90508467 -0.90742363 -0.908634005 -0.91010685
## acousticness       .          .           .           .            .         
## instrumentalness   .          .           .           .            .         
## liveness           .          .           .           .            .         
## valence            2.9632746  3.00766419  3.05267701  3.094742878  3.13534270
## tempo             -1.8514323 -1.86587097 -1.88074766 -1.896083407 -1.91196079
## track.duration_ms  2.5450120  2.58906292  2.63126159  2.667636894  2.70307728
## C                  .          .           .           .            .         
## `C#|Db`            .          .           .           .            .         
## D                  .          .           .           .            .         
## `D#|Eb`            .          .           .           .            .         
## E                  .          .           .           .            .         
## F                  5.2054341  5.30467301  5.40586185  5.494233462  5.57967612
## `F#|Gb`            0.4132894  0.41147120  0.40481038  0.398417727  0.39061433
## G                 -3.5808222 -3.61904635 -3.66035337 -3.702753122 -3.74398302
## `G#|Ab`            1.0015822  1.02215072  1.04156309  1.055722753  1.06668317
## A                  0.6817331  0.68382535  0.67817279  0.664650129  0.65104208
## `A#|Bb`            .          .           .           .            .         
## B                 -0.7769176 -0.78991944 -0.80879173 -0.828988846 -0.85354879
## c01                2.2163901  2.27801094  2.33536427  2.382776414  2.43025035
## c02                5.2285157  5.26753928  5.30353363  5.331182986  5.35565575
## c03               -7.3502903 -7.47390077 -7.59294712 -7.695185133 -7.79559410
## c04                4.8991359  4.99257358  5.08717616  5.169385115  5.25061382
## c05               -0.0114890 -0.01910488 -0.02729403 -0.035532795 -0.04434373
## c06               -2.5494845 -2.57394698 -2.60092735 -2.630709271 -2.66201373
## c07                .          .           .          -0.002809888 -0.01042697
## c08               -0.3009964 -0.30690770 -0.31317650 -0.319472712 -0.32648704
## c09                3.7453452  3.79720604  3.84782888  3.890475227  3.93236357
## c10                .          .           .           .            .         
## c11                2.2101800  2.26060610  2.31082808  2.353081490  2.39057404
## c12               -2.1583956 -2.19377441 -2.22980178 -2.263526582 -2.29764212
##                                                                              
##                    2.76545709  2.80823985  2.85180755  2.89080927  2.91770591
## danceability      -0.95661094 -0.97078892 -0.98345728 -0.99147772 -1.00261356
## energy             0.25625899  0.27259512  0.29000317  0.30732544  0.31851542
## loudness          -0.81670355 -0.84294420 -0.86811359 -0.89129961 -0.91921948
## speechiness       -0.90976174 -0.91176994 -0.91281266 -0.91451354 -0.92465600
## acousticness       .           .           .           .           .         
## instrumentalness   .           .           .           .           .         
## liveness           .           .           .           .           .         
## valence            3.17449684  3.21149511  3.24963168  3.28683363  3.30744622
## tempo             -1.92771625 -1.94109220 -1.95447953 -1.96846128 -1.97837264
## track.duration_ms  2.73805088  2.76840071  2.79778070  2.82056246  2.83949317
## C                  .           .           .           .           .         
## `C#|Db`            .           .           .           .           .         
## D                  .           .           .           .           .         
## `D#|Eb`            .           .           .           .           .         
## E                  .           .           .           .           .         
## F                  5.66237876  5.73971210  5.82020602  5.89561404  5.94322694
## `F#|Gb`            0.38178468  0.37186991  0.36078287  0.35059838  0.35411375
## G                 -3.78423982 -3.82351664 -3.86444982 -3.90457690 -3.93047445
## `G#|Ab`            1.07537827  1.08226080  1.08876858  1.09617195  1.10301407
## A                  0.63525953  0.61854005  0.59996103  0.58072810  0.56820166
## `A#|Bb`            .           .           .           .           .         
## B                 -0.88085395 -0.91096504 -0.94371321 -0.97510045 -0.98715775
## c01                2.47788516  2.51959309  2.56150700  2.59903135  2.62752907
## c02                5.37743197  5.39444626  5.40952323  5.42030080  5.42679508
## c03               -7.89445234 -7.98077341 -8.06596437 -8.14173770 -8.19987015
## c04                5.33177085  5.40420113  5.47725546  5.54566163  5.59542299
## c05               -0.05329366 -0.06178461 -0.07083773 -0.07939688 -0.08579187
## c06               -2.69432300 -2.72436996 -2.75563127 -2.78622179 -2.81050190
## c07               -0.02029213 -0.03122479 -0.04371854 -0.05720949 -0.06808620
## c08               -0.33427375 -0.34336999 -0.35371950 -0.36385543 -0.37335220
## c09                3.97378685  4.01023896  4.04575915  4.07801139  4.10453703
## c10                .           .           .           .           .         
## c11                2.42517255  2.45383695  2.48168825  2.50813421  2.52248589
## c12               -2.33196589 -2.36227244 -2.39315547 -2.42218332 -2.44324783
##                                                                      
##                    2.94898379  2.97833044  3.022473e+00  3.0447837729
## danceability      -0.99357040 -0.97899263 -9.620319e-01 -0.9302344988
## energy             0.33191312  0.34349532  3.533665e-01  0.3620871608
## loudness          -0.95516431 -0.98811594 -1.016003e+00 -1.0380847461
## speechiness       -0.95301358 -0.98227210 -1.015851e+00 -1.0540491368
## acousticness       .           .           .             .           
## instrumentalness   .           .           .             .           
## liveness           .           .           .             .           
## valence            3.33337919  3.35907751  3.383337e+00  3.4091205273
## tempo             -1.98635704 -1.99155215 -1.995840e+00 -2.0028256631
## track.duration_ms  2.86717693  2.89352189  2.915921e+00  2.9371497287
## C                  .           .           .             .           
## `C#|Db`            .           .           .             .           
## D                  .           .           .             .           
## `D#|Eb`            .           .           .             .           
## E                  .           .           .             .           
## F                  6.01295946  6.08917732  6.153733e+00  6.2489909157
## `F#|Gb`            0.35941629  0.36225904  3.609886e-01  0.3608157916
## G                 -3.95485277 -3.97900538 -4.005912e+00 -4.0329626051
## `G#|Ab`            1.11684147  1.13146450  1.138892e+00  1.1542796915
## A                  0.56374058  0.56198275  5.600506e-01  0.5535214757
## `A#|Bb`            .           .           .             .           
## B                 -1.00331118 -1.02273132 -1.044594e+00 -1.0684195700
## c01                2.66436337  2.69805164  2.724404e+00  2.7538158344
## c02                5.43709232  5.44437458  5.449345e+00  5.4509302792
## c03               -8.27985160 -8.35589381 -8.419394e+00 -8.4811939104
## c04                5.66555052  5.73411038  5.788322e+00  5.8499690346
## c05               -0.09574325 -0.10546060 -1.140390e-01 -0.1239867069
## c06               -2.83909898 -2.86862745 -2.893100e+00 -2.9258060455
## c07               -0.06487709 -0.05645013 -5.194107e-02 -0.0466156598
## c08               -0.38681417 -0.39855153 -4.109065e-01 -0.4269778944
## c09                4.14303400  4.17781984  4.206841e+00  4.2326905485
## c10                .           .          -9.859515e-05 -0.0007471726
## c11                2.53999598  2.55494623  2.565995e+00  2.5822793082
## c12               -2.46884059 -2.49129165 -2.508754e+00 -2.5277979883
##                                             
##                    3.064464223  3.115965e+00
## danceability      -0.913244693 -8.919044e-01
## energy             0.371242343  3.779536e-01
## loudness          -1.064410151 -1.083877e+00
## speechiness       -1.103264668 -1.134243e+00
## acousticness       .            9.461405e-05
## instrumentalness   .            .           
## liveness           .            .           
## valence            3.435828444  3.444861e+00
## tempo             -2.004072798 -2.005347e+00
## track.duration_ms  2.961083644  2.977375e+00
## C                  .            .           
## `C#|Db`            .            .           
## D                  .            .           
## `D#|Eb`            .            .           
## E                  .            .           
## F                  6.338403494  6.391761e+00
## `F#|Gb`            0.361718479  3.683381e-01
## G                 -4.061904657 -4.097748e+00
## `G#|Ab`            1.174103989  1.183481e+00
## A                  0.547736168  5.420442e-01
## `A#|Bb`            .            .           
## B                 -1.092254251 -1.109361e+00
## c01                2.789651430  2.811561e+00
## c02                5.450558435  5.449857e+00
## c03               -8.554147226 -8.601209e+00
## c04                5.920831846  5.963750e+00
## c05               -0.135538449 -1.427891e-01
## c06               -2.962854077 -2.981246e+00
## c07               -0.039748304 -3.496600e-02
## c08               -0.446074299 -4.581470e-01
## c09                4.263108090  4.282612e+00
## c10               -0.006132582 -1.289530e-02
## c11                2.592476641  2.595851e+00
## c12               -2.548143008 -2.560296e+00
## 
## $`Indie Pop`
## 35 x 100 sparse Matrix of class "dgCMatrix"
##   [[ suppressing 100 column names 's0', 's1', 's2' ... ]]
##                                                                       
##                   -7.285839e-17 -0.001539806 -0.005168533 -0.009868875
## danceability       .             .            .            .          
## energy             .             .            .            .          
## loudness           .             .            .            .          
## speechiness        .             .            .            .          
## acousticness       .             0.123295905  0.232401724  0.331210620
## instrumentalness   .             .            .            .          
## liveness           .             .            .            .          
## valence            .             .            .            .          
## tempo              .             .            .            .          
## track.duration_ms  .             .            .            .          
## C                  .             .            .            .          
## `C#|Db`            .             .            .            .          
## D                  .             .            .            .          
## `D#|Eb`            .             .            .            .          
## E                  .             .            .            .          
## F                  .             .            .            .          
## `F#|Gb`            .             .            .            .          
## G                  .             .            .            .          
## `G#|Ab`            .             .            .            .          
## A                  .             .            .            .          
## `A#|Bb`            .             .            .            .          
## B                  .             .            .            .          
## c01                .             .            .            .          
## c02                .             .            .            .          
## c03                .             .            .            .          
## c04                .             .            .            .          
## c05                .             .            .            .          
## c06                .             .            .            .          
## c07                .             .            .            .          
## c08                .             .            .            .          
## c09                .             .            .            .          
## c10                .             .            .            .          
## c11                .             .            .            .          
## c12                .             .            .            .          
##                                                                             
##                   -0.01488557 -0.01992747 -0.0248026 -0.02933773 -0.03356541
## danceability       .           .           .          .           .         
## energy             .           .           .          .           .         
## loudness           .           .           .          .           .         
## speechiness        .           .           .          .           .         
## acousticness       0.42225883  0.50717602  0.5870556  0.66271810  0.72045070
## instrumentalness   .           .           .          .           .         
## liveness           .           .           .          .           .         
## valence            .           .           .          .           .         
## tempo              .           .           .          .           .         
## track.duration_ms  .           .           .          .           .         
## C                  .           .           .          .           .         
## `C#|Db`            .           .           .          .           .         
## D                  .           .           .          .           .         
## `D#|Eb`            .           .           .          .           .         
## E                  .           .           .          .           .         
## F                  .           .           .          .           .         
## `F#|Gb`            .           .           .          .           .         
## G                  .           .           .          .           .         
## `G#|Ab`            .           .           .          .           .         
## A                  .           .           .          .           .         
## `A#|Bb`            .           .           .          .           .         
## B                  .           .           .          .           .         
## c01                .           .           .          .           .         
## c02                .           .           .          .          -0.02106544
## c03                .           .           .          .           .         
## c04                .           .           .          .           .         
## c05                .           .           .          .           .         
## c06                .           .           .          .           .         
## c07                .           .           .          .           .         
## c08                .           .           .          .           .         
## c09                .           .           .          .           .         
## c10                .           .           .          .           .         
## c11                .           .           .          .           .         
## c12                .           .           .          .           .         
##                                                                             
##                   -0.03765738 -0.0415224 -0.0451860 -0.04827811 -0.049484217
## danceability       .           .          .          .           .          
## energy             .           .          .          .           .          
## loudness           .           .          .          .           .          
## speechiness        .           .          .          .           .          
## acousticness       0.76010104  0.7979697  0.8323856  0.86561090  0.900662979
## instrumentalness   .           .          .          .           .          
## liveness           .           .          .          .           .          
## valence            .           .          .          .           .          
## tempo              .           .          .          .           .          
## track.duration_ms  .           .          .          .           .          
## C                  .           .          .          .           .          
## `C#|Db`            .           .          .          .           .          
## D                  .           .          .          .           .          
## `D#|Eb`            .           .          .          .           .          
## E                  .           .          .          .           .          
## F                  .           .          .          .           .          
## `F#|Gb`            .           .          .          .           .          
## G                  .           .          .          .           .          
## `G#|Ab`            .           .          .          .           .          
## A                  .           .          .          .           .          
## `A#|Bb`            .           .          .          .           .          
## B                  .           .          .          .           0.004839952
## c01                .           .          .          .           .          
## c02               -0.06428247 -0.1061715 -0.1420501 -0.17485862 -0.210887698
## c03                .           .          .          .           .          
## c04                .           .          .          .           .          
## c05                .           .          .          .           .          
## c06                .           .          .          .           0.008614359
## c07                .           .          .          .           .          
## c08                .           .          .          .           .          
## c09                .           .          .          .           .          
## c10                .           .          .          .           .          
## c11                .           .          .          .           .          
## c12                .           .          .          .           .          
##                                                                              
##                   -0.05175403 -0.05770704 -0.06550099 -0.07449121 -0.08559369
## danceability       .           .           .           .           .         
## energy             .           .           .           .           .         
## loudness           .           .           .           .           .         
## speechiness        .           .           .           .           .         
## acousticness       0.90298258  0.87565289  0.85525123  0.83333569  0.80237069
## instrumentalness   .           .           .           .           .         
## liveness           .           .           .           .           .         
## valence            .           .           .           .           .         
## tempo              .           .           .           .           .         
## track.duration_ms  .           .           .           .           .         
## C                  .           .           .           .           .         
## `C#|Db`            .           .           .           .           .         
## D                  0.02484375  0.08239705  0.13659690  0.18643458  0.23841788
## `D#|Eb`            .           .           .           .           .         
## E                  .           .           .           .           .         
## F                  .           .           .           .           .         
## `F#|Gb`            .           .           .           .           .         
## G                  0.02156402  0.09257354  0.15741529  0.21910568  0.27645217
## `G#|Ab`            .           .           .           .           .         
## A                  .           .           .           .           .         
## `A#|Bb`            .           .           .           .           .         
## B                  0.03012687  0.06431283  0.09657049  0.12944906  0.15939344
## c01                .           .           .           .           .         
## c02               -0.26809655 -0.35419744 -0.43291487 -0.51858282 -0.60878597
## c03                .           .           .           .           .         
## c04                .           .           .           .          -0.02453557
## c05                .           .           .           .           .         
## c06                0.05714421  0.11042438  0.15361140  0.18957359  0.22926696
## c07                .           .           .           .           .         
## c08                .           .           .           .           .         
## c09                .           .           .           .           .         
## c10                .           .           .           .           .         
## c11                .           .           .           .           .         
## c12                .           .           .           .           .         
##                                                                              
##                   -0.09721579 -0.10770852 -0.11895365 -0.13063000 -0.14355076
## danceability      -0.02234334 -0.06468146 -0.11328963 -0.16276007 -0.21429531
## energy             .           .           .           .           .         
## loudness           .           .           .           .           .         
## speechiness        .           .           .           .           .         
## acousticness       0.76245314  0.73251825  0.70687105  0.68872741  0.67666949
## instrumentalness   .           .           .           .           .         
## liveness           .           .           .           .           .         
## valence            .           .           .           .           .         
## tempo              .           .           .           .           .         
## track.duration_ms  .           .           .           .           .         
## C                  .           .           .           .           .         
## `C#|Db`            .           .           .           .           .         
## D                  0.29444541  0.35146050  0.41456981  0.48117503  0.54227191
## `D#|Eb`            .           .          -0.03158739 -0.07587134 -0.12174702
## E                  .           .           .           .           .         
## F                  .           .           .           .           .         
## `F#|Gb`            .           .           .           .           .         
## G                  0.33602562  0.38597800  0.43238025  0.47918947  0.52154301
## `G#|Ab`            .           .           .           .           .         
## A                  .           .           .           .           .         
## `A#|Bb`            .           .           .           .           .         
## B                  0.19064145  0.21947095  0.23477176  0.24375288  0.25117670
## c01                .           .           .           .           .         
## c02               -0.70848049 -0.80631195 -0.90358805 -0.99924618 -1.08161899
## c03                .           .           .           .           .         
## c04               -0.04816595 -0.06397314 -0.07228661 -0.07620988 -0.08098322
## c05                .           .           .           .           .         
## c06                0.27645754  0.30987377  0.34777310  0.38746112  0.42394663
## c07                .           .           .           .           .         
## c08                .           .           .           .           .         
## c09                .           .           .           .           .         
## c10                .           .           .           .           .         
## c11                .           .           .           .           .         
## c12                .           .           .           .           .         
##                                                                            
##                   -0.15892248 -0.17101173 -0.18297629 -0.1985757 -0.2133825
## danceability      -0.26488887 -0.31764234 -0.34452618 -0.3499627 -0.3131933
## energy             .           .           .           .          .        
## loudness           .           .           .           .          .        
## speechiness        .           .           .           .          .        
## acousticness       0.66177480  0.62023098  0.57808690  0.5281747  0.4736125
## instrumentalness   .           .           .           .          .        
## liveness           .           .           .           .          .        
## valence            .           .           .           .          .        
## tempo              .           .           .           .          .        
## track.duration_ms  .           .           .           .          .        
## C                  .           .           .           .          .        
## `C#|Db`            .           .           .           .          .        
## D                  0.60291244  0.66431494  0.72391170  0.7918965  0.8527208
## `D#|Eb`           -0.16012935 -0.19933824 -0.23087517 -0.2572921 -0.2733290
## E                  .           .           .           .          .        
## F                  .           .           .           .          .        
## `F#|Gb`            .           .           .           .          .        
## G                  0.55995294  0.59294738  0.64603787  0.7084747  0.7707612
## `G#|Ab`            .           .           .           .          .        
## A                  .           .           .           .          .        
## `A#|Bb`            .           .           .           .          .        
## B                  0.26129583  0.27287555  0.28914004  0.3091546  0.3361455
## c01                .           .           .           .          .        
## c02               -1.15824919 -1.20302413 -1.28090697 -1.3690816 -1.4667752
## c03                .           .           .           .          .        
## c04               -0.08158623 -0.08234395 -0.03163435  .          .        
## c05                .           .           .           .          .        
## c06                0.45734272  0.47830553  0.51133864  0.5428641  0.5722612
## c07                .           .           .           .          .        
## c08                .           .           .           .          .        
## c09                .           .           .           .          .        
## c10                .           .           .           .          .        
## c11                .           .           .           .          .        
## c12                .           .           .           .          .        
##                                                                              
##                   -0.22749874 -0.240931055 -0.25563422 -0.2682458 -0.27891416
## danceability      -0.27276870 -0.224409522 -0.17502115 -0.1320092 -0.05406462
## energy             .           .            .           .          .         
## loudness           .           .            .           .          .         
## speechiness        .           0.001017773  .           .          .         
## acousticness       0.43067840  0.405010182  0.38986254  0.3723834  0.35008374
## instrumentalness   .           .            .           .          .         
## liveness           .           0.014206497  0.06216438  0.1128244  0.17686529
## valence            .           .            .           .          .         
## tempo              .           .            .           .          .         
## track.duration_ms  .           .            .           .          .         
## C                  .           .            .           .          .         
## `C#|Db`            .           .            .           .          .         
## D                  0.91131259  0.966968503  1.01564143  1.0657442  1.10771410
## `D#|Eb`           -0.29474837 -0.321363078 -0.35091622 -0.3756067 -0.36888730
## E                  .           .            .           .          .         
## F                  .           .            .           .          .         
## `F#|Gb`            .           .            .           .          .         
## G                  0.83385020  0.896269231  0.96020880  1.0112211  1.05714793
## `G#|Ab`            .           .            .           .          .         
## A                  .           .            .           .          .         
## `A#|Bb`            0.01361663  0.058521073  0.10190597  0.1431594  0.18556139
## B                  0.35920834  0.385644952  0.41740154  0.4285180  0.46587459
## c01                .           .            .           .          .         
## c02               -1.57462309 -1.683113600 -1.78740214 -1.8690246 -1.95948181
## c03                .           .            .           .          .         
## c04                .           .            .           .          .         
## c05                .           .            .           .          .         
## c06                0.60451183  0.632924921  0.66078287  0.6665671  0.66269074
## c07                .           .            .           .          .         
## c08                .           .            .           .          .         
## c09                .          -0.012937584 -0.02932028  .          .         
## c10                .           .            .           .          .         
## c11                .           .            .           .          .         
## c12                .           .            .           .          .         
##                                                                         
##                   -0.2878713 -0.2957060 -0.3003124 -0.3023211 -0.3031685
## danceability       .          .          .          .          .        
## energy             .          .          .          .          .        
## loudness           .          .          .          .          .        
## speechiness        .          .          .          .          .        
## acousticness       0.3373574  0.3342415  0.3284165  0.3116657  0.2771226
## instrumentalness   .          .          .          .          .        
## liveness           0.2473562  0.3086056  0.3684270  0.4029237  0.4243901
## valence            .          .          .          .          .        
## tempo              .          .          .          .          .        
## track.duration_ms  .          .          .          .          .        
## C                  .          .          .          .          .        
## `C#|Db`            .          .          .          .          .        
## D                  1.1569434  1.2066339  1.2653710  1.3292549  1.3949123
## `D#|Eb`           -0.3941490 -0.4427591 -0.4849748 -0.5126669 -0.5348798
## E                  .          .          .          .          .        
## F                  .          .          .          .          .        
## `F#|Gb`            .          .          .          .          .        
## G                  1.1131013  1.1708698  1.2320291  1.2969718  1.3671238
## `G#|Ab`            .          .          .          .          .        
## A                  .          .          .          .          .        
## `A#|Bb`            0.2099498  0.2392680  0.2567765  0.2594698  0.2671042
## B                  0.5045394  0.5359600  0.5719168  0.6143070  0.6597637
## c01                .          .          .          .          .        
## c02               -2.0615564 -2.1688437 -2.2785199 -2.3913754 -2.5098096
## c03                .          .          .          .          .        
## c04                .          .          .          .          .        
## c05                .          .          .          .          .        
## c06                0.6633755  0.6717476  0.6869490  0.7219103  0.7712363
## c07                .          .          .          .          .        
## c08                .          .          .          .          .        
## c09                .          .          .          .          .        
## c10                .          .          .          .          .        
## c11                .          .          .          .          .        
## c12                .          .          .          .          .        
##                                                                          
##                   -0.29967643 -0.2825418 -0.2675073 -0.2549803 -0.2426813
## danceability       .           .          .          .          .        
## energy             .           .          .          .          .        
## loudness           .           .          .          .          .        
## speechiness        .           .          .          .          .        
## acousticness       0.24715821  0.2094176  0.1706929  0.1362865  0.1023151
## instrumentalness   .           .          .          .          .        
## liveness           0.44152106  0.4464512  0.4483075  0.4630245  0.4844125
## valence            .           .          .          .          .        
## tempo              .           .          .          .          .        
## track.duration_ms  .           .          .          .          .        
## C                  .           .          .          .          .        
## `C#|Db`            .           .          .          .          .        
## D                  1.46398678  1.5382022  1.5965353  1.6363301  1.6702419
## `D#|Eb`           -0.55251112 -0.5585295 -0.5673134 -0.5934803 -0.6219315
## E                  .           .          .          .          .        
## F                  .           .          .          .          .        
## `F#|Gb`            .           .          .          .          .        
## G                  1.43574160  1.4934220  1.5574640  1.6188399  1.6810659
## `G#|Ab`            .           .          .          .          .        
## A                  .           .          .          .          .        
## `A#|Bb`            0.27037691  0.2656226  0.2658053  0.2660372  0.2649892
## B                  0.69675637  0.6944864  0.6847466  0.6714343  0.6624968
## c01                .           .          .          .          .        
## c02               -2.63801014 -2.7919864 -2.9795145 -3.1364009 -3.2892276
## c03                .           .          .          .          .        
## c04                .           .          .          .          .        
## c05                .           .          .          .          .        
## c06                0.81254230  0.8071410  0.8097900  0.8438368  0.8865920
## c07                .           .          .          .          .        
## c08                .           .          .          .          .        
## c09                .           .          .          .          .        
## c10                .           .          .          .          .        
## c11               -0.04059337 -0.1493537 -0.2281940 -0.2449967 -0.2448961
## c12                .           .          .          .          .        
##                                                                           
##                   -0.22185679 -0.19351695 -0.1584897 -0.1121774 -0.0608902
## danceability       .           .           .          .          .        
## energy             .           .           .          .          .        
## loudness           .           .           .          .          .        
## speechiness        .           .           .          .          .        
## acousticness       0.06619239  0.03372079  .          .          .        
## instrumentalness   .           .           .          .          .        
## liveness           0.50843360  0.52653985  0.5433027  0.5572535  0.5696287
## valence            .           .           .          .          .        
## tempo              .           .           .          .          .        
## track.duration_ms  .           .           .          .          .        
## C                  .           .           .          .          .        
## `C#|Db`            .           .           .          .          .        
## D                  1.69452424  1.71288891  1.7383295  1.7715100  1.8215075
## `D#|Eb`           -0.65563457 -0.71062634 -0.7691781 -0.8293083 -0.8769637
## E                  .           .           .          .          .        
## F                  .           .           .          .          .        
## `F#|Gb`            .           .           .          .          .        
## G                  1.74450208  1.78982175  1.8264540  1.8352831  1.8352243
## `G#|Ab`            .           .           .          .          .        
## A                  .           .           .          .          .        
## `A#|Bb`            0.25927262  0.24439357  0.2266904  0.2196868  0.2157421
## B                  0.65835536  0.64956369  0.6381855  0.6031935  0.5661842
## c01                .           .           .          .          .        
## c02               -3.43204482 -3.54793740 -3.6575927 -3.7461100 -3.8262965
## c03                .           .           .          .          .        
## c04                .           .           .          .          .        
## c05                .           .           .          .          .        
## c06                0.92636095  0.95668728  0.9694655  0.9656440  0.9551090
## c07                .           .           .          .          .        
## c08                .           .           .          .          .        
## c09                .           .           .          .          .        
## c10                .           .           .          .          .        
## c11               -0.24457205 -0.25762809 -0.2864068 -0.3298000 -0.3662949
## c12                .           .           .          .          .        
##                                                                             
##                   -0.008366388  0.04356768  0.09430913  0.1431169  0.1910016
## danceability       .            .           .           .          .        
## energy             .            .           .           .          .        
## loudness           .            .           .           .          .        
## speechiness        .            .           .           .          .        
## acousticness       .            .           .           .          .        
## instrumentalness   .            .           .           .          .        
## liveness           0.582477192  0.59745158  0.61491829  0.6413152  0.6700020
## valence            .            .           .           .          .        
## tempo              .            .           .           .          .        
## track.duration_ms  .            .           .           .          .        
## C                  .            .           .           .          .        
## `C#|Db`            .            .           .           .          .        
## D                  1.879190634  1.94396323  2.01553921  2.0841063  2.1499864
## `D#|Eb`           -0.914514495 -0.94462980 -0.96782555 -0.9793844 -0.9871056
## E                  .            .           .           .          .        
## F                  .            .           .           .          .        
## `F#|Gb`            .            .           .           .          .        
## G                  1.829108083  1.81796097  1.80294052  1.7912513  1.7853175
## `G#|Ab`            .            .           .           .          .        
## A                  .            .           .           .          .        
## `A#|Bb`            0.214705938  0.21678202  0.22039651  0.2209651  0.2190540
## B                  0.528706674  0.49166762  0.45676018  0.4326244  0.4146151
## c01                .            .           .           .          .        
## c02               -3.903008353 -3.97429156 -4.03953280 -4.1064369 -4.1779340
## c03                .            .           .           .          .        
## c04                .            .           .           .          .        
## c05                .            .           .           .          .        
## c06                0.936221558  0.90901783  0.87547882  0.8442944  0.8196347
## c07                .            .           .           .          .        
## c08                .            .           .           .          .        
## c09                .            .           .           .          .        
## c10                .            .           .           .          .        
## c11               -0.401896938 -0.43700093 -0.47083838 -0.4954215 -0.5141937
## c12                .            .           .           .          .        
##                                                                         
##                    0.2380328  0.2843621  0.3303851  0.3787012  0.4249879
## danceability       .          .          .          .          .        
## energy             .          .          .          .          .        
## loudness           .          .          .          .          .        
## speechiness        .          .          .          .          .        
## acousticness       .          .          .          .          .        
## instrumentalness   .          .          .          .          .        
## liveness           0.6993429  0.7290142  0.7594979  0.7930156  0.8283925
## valence            .          .          .          .          .        
## tempo              .          .          .          .          .        
## track.duration_ms  .          .          .          .          .        
## C                  .          .          .          .          .        
## `C#|Db`            .          .          .          .          .        
## D                  2.2154388  2.2791700  2.3435288  2.4068077  2.4678202
## `D#|Eb`           -0.9929558 -0.9984726 -1.0034573 -1.0070796 -1.0151973
## E                  .          .          .          .          .        
## F                  .          .          .          .          .        
## `F#|Gb`            .          .          .          .          .        
## G                  1.7821292  1.7825586  1.7820485  1.7734634  1.7661664
## `G#|Ab`            .          .          .          .          .        
## A                  .          .          .          .          .        
## `A#|Bb`            0.2164646  0.2127321  0.2113820  0.2174039  0.2244191
## B                  0.3992584  0.3868304  0.3742573  0.3565036  0.3384158
## c01                .          .          .          .          .        
## c02               -4.2519153 -4.3285119 -4.4077233 -4.4890929 -4.5748371
## c03                .          .          .          .          .        
## c04                .          .          .          .          .        
## c05                .          .          .          .          .        
## c06                0.7983508  0.7820243  0.7678559  0.7492505  0.7349962
## c07                .          .          .          .          .        
## c08                .          .          .          .          .        
## c09                .          .          .          .          .        
## c10                .          .          .          .          .        
## c11               -0.5301127 -0.5428768 -0.5527487 -0.5627979 -0.5706886
## c12                .          .          .          .          .        
##                                                                         
##                    0.4699684  0.5137711  0.5565932  0.5985300  0.6397070
## danceability       .          .          .          .          .        
## energy             .          .          .          .          .        
## loudness           .          .          .          .          .        
## speechiness        .          .          .          .          .        
## acousticness       .          .          .          .          .        
## instrumentalness   .          .          .          .          .        
## liveness           0.8640829  0.8995371  0.9345921  0.9693910  1.0037405
## valence            .          .          .          .          .        
## tempo              .          .          .          .          .        
## track.duration_ms  .          .          .          .          .        
## C                  .          .          .          .          .        
## `C#|Db`            .          .          .          .          .        
## D                  2.5288968  2.5885735  2.6470701  2.7045628  2.7606705
## `D#|Eb`           -1.0244999 -1.0348527 -1.0454264 -1.0555325 -1.0646435
## E                  .          .          .          .          .        
## F                  .          .          .          .          .        
## `F#|Gb`            .          .          .          .          .        
## G                  1.7592678  1.7544463  1.7518872  1.7518897  1.7544978
## `G#|Ab`            .          .          .          .          .        
## A                  .          .          .          .          .        
## `A#|Bb`            0.2325149  0.2404547  0.2479863  0.2547377  0.2601078
## B                  0.3196636  0.3013091  0.2834936  0.2667335  0.2513479
## c01                .          .          .          .          .        
## c02               -4.6638162 -4.7567264 -4.8538436 -4.9547454 -5.0598691
## c03                .          .          .          .          .        
## c04                .          .          .          .          .        
## c05                .          .          .          .          .        
## c06                0.7227858  0.7149650  0.7113200  0.7113820  0.7161478
## c07                .          .          .          .          .        
## c08                .          .          .          .          .        
## c09                .          .          .          .          .        
## c10                .          .          .          .          .        
## c11               -0.5777513 -0.5829864 -0.5866151 -0.5889278 -0.5893329
## c12                .          .          .          .          .        
##                                                                         
##                    0.6802031  0.7193533  0.7599812  0.8002457  0.8419051
## danceability       .          .          .          .          .        
## energy             .          .          .          .          .        
## loudness           .          .          .          .          .        
## speechiness        .          .          .          .          .        
## acousticness       .          .          .          .          .        
## instrumentalness   .          .          .          .          .        
## liveness           1.0377400  1.0716919  1.1065613  1.1417704  1.1753009
## valence            .          .          .          .          .        
## tempo              .          .          .          .          .        
## track.duration_ms  .          .          .          .          .        
## C                  .          .          .          .          .        
## `C#|Db`            .          .          .          .          .        
## D                  2.8158956  2.8682879  2.9183881  2.9638031  3.0114011
## `D#|Eb`           -1.0738507 -1.0838615 -1.0941174 -1.1056152 -1.1123367
## E                  .          .          .          .          .        
## F                  .          .          .          .          .        
## `F#|Gb`            .          .          .          .          .        
## G                  1.7588230  1.7660393  1.7714632  1.7803885  1.7893043
## `G#|Ab`            .          .          .          .          .        
## A                  .          .          .          .          .        
## `A#|Bb`            0.2651407  0.2682164  0.2712354  0.2721715  0.2743764
## B                  0.2366172  0.2242870  0.2134050  0.2069806  0.1999640
## c01                .          .          .          .          .        
## c02               -5.1674285 -5.2768911 -5.3829891 -5.4858925 -5.5917089
## c03                .          .          .          .          .        
## c04                .          .          .          .          .        
## c05                .          .          .          .          .        
## c06                0.7243634  0.7380476  0.7568734  0.7825895  0.8072540
## c07                .          .          .          .          .        
## c08                .          .          .          .          .        
## c09                .          .          .          .          .        
## c10                .          .          .          .          .        
## c11               -0.5879957 -0.5840996 -0.5776767 -0.5681981 -0.5597874
## c12                .          .          .          .          .        
##                                                                         
##                    0.8806079  0.9220428  0.9611701  1.0006369  1.0378588
## danceability       .          .          .          .          .        
## energy             .          .          .          .          .        
## loudness           .          .          .          .          .        
## speechiness        .          .          .          .          .        
## acousticness       .          .          .          .          .        
## instrumentalness   .          .          .          .          .        
## liveness           1.2095167  1.2419258  1.2754614  1.3064863  1.3380603
## valence            .          .          .          .          .        
## tempo              .          .          .          .          .        
## track.duration_ms  .          .          .          .          .        
## C                  .          .          .          .          .        
## `C#|Db`            .          .          .          .          .        
## D                  3.0579345  3.1069574  3.1534476  3.2015664  3.2486811
## `D#|Eb`           -1.1215528 -1.1266133 -1.1363315 -1.1406814 -1.1473901
## E                  .          .          .          .          .        
## F                  .          .          .          .          .        
## `F#|Gb`            .          .          .          .          .        
## G                  1.8030588  1.8167083  1.8343396  1.8536855  1.8768461
## `G#|Ab`            .          .          .          .          .        
## A                  .          .          .          .          .        
## `A#|Bb`            0.2749622  0.2752157  0.2740250  0.2722883  0.2690427
## B                  0.1975852  0.1927661  0.1904631  0.1894356  0.1903705
## c01                .          .          .          .          .        
## c02               -5.6947294 -5.8024321 -5.9087897 -6.0177117 -6.1262386
## c03                .          .          .          .          .        
## c04                .          .          .          .          .        
## c05                .          .          .          .          .        
## c06                0.8331918  0.8576190  0.8852987  0.9131383  0.9423981
## c07                .          .          .          .          .        
## c08                .          .          .          .          .        
## c09                .          .          .          .          .        
## c10                .          .          .          .          .        
## c11               -0.5507958 -0.5429421 -0.5329958 -0.5224775 -0.5113964
## c12                .          .          .          .          .        
##                                                                         
##                    1.0751472  1.1112623  1.1458290  1.1799084  1.2157559
## danceability       .          .          .          .          .        
## energy             .          .          .          .          .        
## loudness           .          .          .          .          .        
## speechiness        .          .          .          .          .        
## acousticness       .          .          .          .          .        
## instrumentalness   .          .          .          .          .        
## liveness           1.3694246  1.4001516  1.4311991  1.4613989  1.4906473
## valence            .          .          .          .          .        
## tempo              .          .          .          .          .        
## track.duration_ms  .          .          .          .          .        
## C                  .          .          .          .          .        
## `C#|Db`            .          .          .          .          .        
## D                  3.2935629  3.3386427  3.3826414  3.4264317  3.4709396
## `D#|Eb`           -1.1536445 -1.1577650 -1.1622736 -1.1656551 -1.1628731
## E                  .          .          .          .          .        
## F                  .          .          .          .          .        
## `F#|Gb`            .          .          .          .          .        
## G                  1.9029952  1.9325043  1.9657023  2.0017761  2.0396926
## `G#|Ab`            .          .          .          .          .        
## A                  .          .          .          .          .        
## `A#|Bb`            0.2637655  0.2572216  0.2492828  0.2395114  0.2290485
## B                  0.1940326  0.2000533  0.2090115  0.2195652  0.2328994
## c01                .          .          .          .          .        
## c02               -6.2368295 -6.3498391 -6.4626274 -6.5775002 -6.6961761
## c03                .          .          .          .          .        
## c04                .          .          .          .          .        
## c05                .          .          .          .          .        
## c06                0.9771497  1.0156081  1.0555744  1.0978984  1.1425250
## c07                .          .          .          .          .        
## c08                .          .          .          .          .        
## c09                .          .          .          .          .        
## c10                .          .          .          .          .        
## c11               -0.4963751 -0.4787463 -0.4595299 -0.4389684 -0.4144248
## c12                .          .          .          .          .        
##                                                                         
##                    1.2479120  1.2811856  1.3125880  1.3425516  1.3730123
## danceability       .          .          .          .          .        
## energy             .          .          .          .          .        
## loudness           .          .          .          .          .        
## speechiness        .          .          .          .          .        
## acousticness       .          .          .          .          .        
## instrumentalness   .          .          .          .          .        
## liveness           1.5215182  1.5510928  1.5820565  1.6124917  1.6406222
## valence            .          .          .          .          .        
## tempo              .          .          .          .          .        
## track.duration_ms  .          .          .          .          .        
## C                  .          .          .          .          .        
## `C#|Db`            .          .          .          .          .        
## D                  3.5143751  3.5573719  3.6030203  3.6506989  3.6997494
## `D#|Eb`           -1.1661929 -1.1620914 -1.1592425 -1.1608926 -1.1615068
## E                  .          .          .          .          .        
## F                  .          .          .          .          .        
## `F#|Gb`            .          .          .          .          .        
## G                  2.0800659  2.1238054  2.1693055  2.2185307  2.2687230
## `G#|Ab`            .          .          .          .          .        
## A                  .          .          .          .          .        
## `A#|Bb`            0.2185873  0.2064658  0.1955767  0.1861402  0.1781572
## B                  0.2472312  0.2645950  0.2828772  0.3000152  0.3160266
## c01                .          .          .          .          .        
## c02               -6.8133259 -6.9340557 -7.0569209 -7.1830580 -7.3137915
## c03                .          .          .          .          .        
## c04                .          .          .          .          .        
## c05                .          .          .          .          .        
## c06                1.1888508  1.2370743  1.2851461  1.3347574  1.3861655
## c07                .          .          .          .          .        
## c08                .          .          .          .          .        
## c09                .          .          .          .          .        
## c10                .          .          .          .          .        
## c11               -0.3887210 -0.3599960 -0.3299605 -0.2992203 -0.2672747
## c12                .          .          .          .          .        
##                                                                          
##                    1.4029733  1.4320409  1.4632359  1.4883990  1.51458331
## danceability       .          .          .          .          .         
## energy             .          .          .          .          .         
## loudness           .          .          .          .          .         
## speechiness        .          .          .          .          .         
## acousticness       .          .          .          .          .         
## instrumentalness   .          .          .          .          .         
## liveness           1.6683172  1.6937312  1.7184244  1.7408796  1.76339115
## valence            .          .          .          .          .         
## tempo              .          .          .          .          .         
## track.duration_ms  .          .          .          .          .         
## C                  .          .          .          .          .         
## `C#|Db`            .          .          .          .          .         
## D                  3.7513603  3.8053805  3.8625035  3.9212379  3.98294829
## `D#|Eb`           -1.1595592 -1.1558608 -1.1451260 -1.1441507 -1.14599827
## E                  .          .          .          .          .         
## F                  .          .          .          .          .         
## `F#|Gb`            .          .          .          .          .         
## G                  2.3197815  2.3718929  2.4252102  2.4752854  2.52629377
## `G#|Ab`            .          .          .          .          .         
## A                  .          .          .          .          .         
## `A#|Bb`            0.1685335  0.1584328  0.1485749  0.1463817  0.14318910
## B                  0.3340842  0.3529985  0.3740026  0.3885248  0.39989517
## c01                .          .          .          .          .         
## c02               -7.4458968 -7.5809941 -7.7205631 -7.8637927 -8.00998904
## c03                .          .          .          .          .         
## c04                .          .          .          .          .         
## c05                .          .          .          .          .         
## c06                1.4395454  1.4946105  1.5519775  1.6050378  1.65806947
## c07                .          .          .          .          .         
## c08                .          .          .          .          .         
## c09                .          .          .          .          .         
## c10                .          .          .          .          .         
## c11               -0.2347720 -0.2019729 -0.1657455 -0.1314213 -0.09876207
## c12                .          .          .          .          .         
##                                                                           
##                    1.54042902  1.56349653  1.5883343  1.6146970  1.6170400
## danceability       .           .           .          .          .        
## energy             .           .           .          .          .        
## loudness           .           .           .          .          .        
## speechiness        .           .           .          .          .        
## acousticness       .           .           .          .          .        
## instrumentalness   .           .           .          .          .        
## liveness           1.78594107  1.80870830  1.8310026  1.8529531  1.8731684
## valence            .           .           .          .          .        
## tempo              .           .           .          .          .        
## track.duration_ms  .           .           .          .          .        
## C                  .           .           .          .          .        
## `C#|Db`            .           .           .          .          .        
## D                  4.04581419  4.11079298  4.1778682  4.2522050  4.3219808
## `D#|Eb`           -1.14775272 -1.15617766 -1.1632550 -1.1751392 -1.2090935
## E                  .           .           .          .          .        
## F                  .           .           .          .          .        
## `F#|Gb`            .           .           .          .          .        
## G                  2.57821629  2.63113814  2.6846271  2.7379174  2.7894608
## `G#|Ab`            .           .           .          .          .        
## A                  .           .           .          .          .        
## `A#|Bb`            0.13972541  0.13891276  0.1367551  0.1309474  0.1307742
## B                  0.41110733  0.42078991  0.4285766  0.4219517  0.4200490
## c01                .           .           .          .          .        
## c02               -8.15861409 -8.30845962 -8.4634478 -8.6196047 -8.7619685
## c03                .           .           .          .          .        
## c04                .           .           .          .          .        
## c05                .           .           .          .          .        
## c06                1.71216116  1.76830321  1.8239825  1.8573220  1.8983816
## c07                .           .           .          .          .        
## c08                .           .           .          .          .        
## c09                .           .           .          .          .        
## c10                .           .           .          .          .        
## c11               -0.06559573 -0.03144625  .          .          .        
## c12                .           .           .          .          .        
##                                                                         
##                    1.6247358  1.6291492  1.6437199  1.6458777  1.6513708
## danceability       .          .          .          .          .        
## energy             .          .          .          .          .        
## loudness           .          .          .          .          .        
## speechiness        .          .          .          .          .        
## acousticness       .          .          .          .          .        
## instrumentalness   .          .          .          .          .        
## liveness           1.8919581  1.9073318  1.9105955  1.9287234  1.9413185
## valence            .          .          .          .          .        
## tempo              .          .          .          .          .        
## track.duration_ms  .          .          .          .          .        
## C                  .          .          .          .          .        
## `C#|Db`            .          .          .          .          .        
## D                  4.3928922  4.4633739  4.5366567  4.6220745  4.6968123
## `D#|Eb`           -1.2456791 -1.2793637 -1.3165864 -1.3560579 -1.3801807
## E                  .          .          .          .          .        
## F                  .          .          .          .          .        
## `F#|Gb`            .          .          .          .          .        
## G                  2.8461939  2.9035106  2.9674777  3.0249189  3.0812263
## `G#|Ab`            .          .          .          .          .        
## A                  .          .          .          .          .        
## `A#|Bb`            0.1316007  0.1359885  0.1388715  0.1435927  0.1450337
## B                  0.4160779  0.4151589  0.4163778  0.4081856  0.4065649
## c01                .          .          .          .          .        
## c02               -8.9205987 -9.0825884 -9.2489655 -9.4344815 -9.6125854
## c03                .          .          .          .          .        
## c04                .          .          .          .          .        
## c05                .          .          .          .          .        
## c06                1.9486230  1.9988049  2.0481915  2.1091988  2.1662550
## c07                .          .          .          .          .        
## c08                .          .          .          .          .        
## c09                .          .          .          .          .        
## c10                .          .          .          .          .        
## c11                .          .          .          .          .        
## c12                .          .          .          .          .        
##                             
##                    1.6754007
## danceability       .        
## energy             .        
## loudness           .        
## speechiness        .        
## acousticness       .        
## instrumentalness   .        
## liveness           1.9336572
## valence            .        
## tempo              .        
## track.duration_ms  .        
## C                  .        
## `C#|Db`            .        
## D                  4.7686727
## `D#|Eb`           -1.4225359
## E                  .        
## F                  .        
## `F#|Gb`            .        
## G                  3.1325851
## `G#|Ab`            .        
## A                  .        
## `A#|Bb`            0.1546062
## B                  0.4045815
## c01                .        
## c02               -9.7656272
## c03                .        
## c04                .        
## c05                .        
## c06                2.2268896
## c07                .        
## c08                .        
## c09                .        
## c10                .        
## c11                .        
## c12                .        
## 
## $`Indie x Running`
## 35 x 100 sparse Matrix of class "dgCMatrix"
##   [[ suppressing 100 column names 's0', 's1', 's2' ... ]]
##                                                                                
##                   2.081668e-17 0.0007794152 0.002589912 0.004908411 0.007428581
## danceability      .            .            .           .           .          
## energy            .            .            .           .           .          
## loudness          .            .            .           .           .          
## speechiness       .            .            .           .           .          
## acousticness      .            .            .           .           .          
## instrumentalness  .            .            .           .           .          
## liveness          .            .            .           .           .          
## valence           .            .            .           .           .          
## tempo             .            .            .           .           .          
## track.duration_ms .            .            .           .           .          
## C                 .            .            .           .           .          
## `C#|Db`           .            .            .           .           .          
## D                 .            .            .           .           .          
## `D#|Eb`           .            .            .           .           .          
## E                 .            .            .           .           .          
## F                 .            .            .           .           .          
## `F#|Gb`           .            .            .           .           .          
## G                 .            .            .           .           .          
## `G#|Ab`           .            .            .           .           .          
## A                 .            .            .           .           .          
## `A#|Bb`           .            .            .           .           .          
## B                 .            .            .           .           .          
## c01               .            .            .           .           .          
## c02               .            .            .           .           .          
## c03               .            .            .           .           .          
## c04               .            .            .           .           .          
## c05               .            .            .           .           .          
## c06               .            .            .           .           .          
## c07               .            .            .           .           .          
## c08               .            .            .           .           .          
## c09               .            .            .           .           .          
## c10               .            .            .           .           .          
## c11               .            .            .           .           .          
## c12               .            .            .           .           .          
##                                                                         
##                   0.009964488 0.01240138 0.01466853 0.01678232 0.0188286
## danceability      .           .          .          .          .        
## energy            .           .          .          .          .        
## loudness          .           .          .          .          .        
## speechiness       .           .          .          .          .        
## acousticness      .           .          .          .          .        
## instrumentalness  .           .          .          .          .        
## liveness          .           .          .          .          .        
## valence           .           .          .          .          .        
## tempo             .           .          .          .          .        
## track.duration_ms .           .          .          .          .        
## C                 .           .          .          .          .        
## `C#|Db`           .           .          .          .          .        
## D                 .           .          .          .          .        
## `D#|Eb`           .           .          .          .          .        
## E                 .           .          .          .          .        
## F                 .           .          .          .          .        
## `F#|Gb`           .           .          .          .          .        
## G                 .           .          .          .          .        
## `G#|Ab`           .           .          .          .          .        
## A                 .           .          .          .          .        
## `A#|Bb`           .           .          .          .          .        
## B                 .           .          .          .          .        
## c01               .           .          .          .          .        
## c02               .           .          .          .          .        
## c03               .           .          .          .          .        
## c04               .           .          .          .          .        
## c05               .           .          .          .          .        
## c06               .           .          .          .          .        
## c07               .           .          .          .          .        
## c08               .           .          .          .          .        
## c09               .           .          .          .          .        
## c10               .           .          .          .          .        
## c11               .           .          .          .          .        
## c12               .           .          .          .          .        
##                                                                         
##                   0.02076099 0.02105870 0.01925395 0.01585099 0.01315430
## danceability      .          .          .          .          .         
## energy            .          .          .          .          .         
## loudness          .          .          .          .          .         
## speechiness       .          .          .          .          .         
## acousticness      .          .          .          .          .         
## instrumentalness  .          .          .          .          .         
## liveness          .          .          .          .          .         
## valence           .          .          .          .          .         
## tempo             .          .          .          .          .         
## track.duration_ms .          .          .          .          .         
## C                 .          .          .          .          .         
## `C#|Db`           .          .          .          .          .         
## D                 .          .          .          .          .         
## `D#|Eb`           .          .          .          0.01208795 0.04596707
## E                 .          .          .          .          .         
## F                 .          .          .          .          .         
## `F#|Gb`           .          .          .          .          .         
## G                 .          .          .          .          .         
## `G#|Ab`           .          .          .          .          .         
## A                 .          .          .          .          .         
## `A#|Bb`           .          .          .          .          .         
## B                 .          .          .          .          .         
## c01               .          .          .          .          .         
## c02               .          .          .          .          .         
## c03               .          0.02102659 0.05484480 0.07386282 0.09059758
## c04               .          .          .          .          .         
## c05               .          .          .          .          .         
## c06               .          .          .          .          .         
## c07               .          .          .          .          .         
## c08               .          .          .          .          .         
## c09               .          .          .          .          .         
## c10               .          .          .          .          .         
## c11               .          .          .          .          .         
## c12               .          .          .          .          .         
##                                                                             
##                   0.012441088 1.285833e-02 0.01417112 0.016756745 0.02026075
## danceability      .           .            .          .           .         
## energy            .           .            .          .           .         
## loudness          .           .            .          .           .         
## speechiness       .           .            .          .           .         
## acousticness      .           .            .          .           .         
## instrumentalness  .           .            .          .           .         
## liveness          .           .            .          .           .         
## valence           .           .            .          .           .         
## tempo             .           .            .          0.006997163 0.04072726
## track.duration_ms .           .            .          .           .         
## C                 .           .            .          .           .         
## `C#|Db`           .           .            .          .           .         
## D                 .           .            .          .           .         
## `D#|Eb`           0.080486288 1.131679e-01 0.14062292 0.167022775 0.18910817
## E                 .           .            .          0.009627684 0.02034858
## F                 .           .            .          .           .         
## `F#|Gb`           .           .            .          .           .         
## G                 .           .            .          .           .         
## `G#|Ab`           .           .            .          .           .         
## A                 .           .            .          .           .         
## `A#|Bb`           .           .            .          .           .         
## B                 .           .            .          .           .         
## c01               .           .            .          .           .         
## c02               .           .            .          .           .         
## c03               0.112315967 1.355542e-01 0.15100038 0.156571692 0.16526227
## c04               .           .            .          .           .         
## c05               .           .            .          .           .         
## c06               .           .            .          .           .         
## c07               .           6.595936e-05 0.02917087 0.056986842 0.08361520
## c08               .           .            .          .           .         
## c09               .           .            .          0.001279450 0.01810675
## c10               0.001277234 1.722370e-02 0.03113929 0.044245169 0.05187487
## c11               .           .            .          .           .         
## c12               .           .            .          .           .         
##                                                                              
##                   0.02517842  0.03204656  0.040855457  0.05200122  0.06750586
## danceability      .           .           .            .           .         
## energy            .           .           .            .           .         
## loudness          .           .           .            .           .         
## speechiness       .           .           .            .           .         
## acousticness      .           .           .            .           .         
## instrumentalness  .           .           .            .           .         
## liveness          .           .           .            .           .         
## valence           .           .           .            .           .         
## tempo             0.07226470  0.09849774  0.117681671  0.13409793  0.15101410
## track.duration_ms .           .           .            .           .         
## C                 .           .           .            .           .         
## `C#|Db`           .           .           .            .           .         
## D                 .           .           .            .           .         
## `D#|Eb`           0.21380654  0.23043280  0.245922320  0.26101069  0.28565241
## E                 0.03159145  0.02566946  0.001297986  .           .         
## F                 .           .           .            .           .         
## `F#|Gb`           .           .           .            .           .         
## G                 .           .           .            .           .         
## `G#|Ab`           .           .           .            .           .         
## A                 .           .           .            .           .         
## `A#|Bb`           .          -0.02291764 -0.069916540 -0.09876052 -0.11987393
## B                 .           .           .            .           .         
## c01               .           .           .            .           .         
## c02               .           .           .            .           .         
## c03               0.17153003  0.17694152  0.181708936  0.18984330  0.20558807
## c04               .           .           .            .           .         
## c05               .           .           .            .           .         
## c06               .           .           .            .           .         
## c07               0.11909023  0.15619850  0.194260892  0.22572949  0.25553572
## c08               .           .           .            .           .         
## c09               0.02559296  0.02952586  0.032297374  0.02646799  0.01560646
## c10               0.06846934  0.08402194  0.097280894  0.11553185  0.13561626
## c11               .           .           .            .           .         
## c12               .           .           .            .           .         
##                                                                              
##                    0.06945985  0.06694427  0.06494791  0.06193878  0.05775528
## danceability       .           0.06670627  0.15028932  0.25204695  0.35683216
## energy             .           .           .           .           .         
## loudness           .           .           .           .           .         
## speechiness        .           .           .           .           .         
## acousticness      -0.09494244 -0.18868866 -0.27678614 -0.37873293 -0.48167683
## instrumentalness   .           .           .           .           .         
## liveness           .           .           .           .           .         
## valence            .           .           .           .           .         
## tempo              0.16272318  0.17630341  0.18324177  0.18670389  0.18227567
## track.duration_ms  .           .           .           .           .         
## C                  .           .           .           .           .         
## `C#|Db`            .           .           .           .           .         
## D                  .           .           .           .           .         
## `D#|Eb`            0.31108596  0.33507692  0.35917492  0.38468283  0.41041780
## E                  .           .           .           .           .         
## F                  .           .           .           .           .         
## `F#|Gb`            .           .           .           .           .         
## G                  .           .           .           .           .         
## `G#|Ab`            .           .           .           .           .         
## A                  .          -0.02925303 -0.06678734 -0.10850924 -0.14863391
## `A#|Bb`           -0.14169020 -0.16460483 -0.19098982 -0.22007585 -0.24624142
## B                  .           .           .           .           .         
## c01                .           .           .           .           .         
## c02                .           .           .           .           .         
## c03                0.22892741  0.30439096  0.38803049  0.41997933  0.43934716
## c04                .           .           .           .           .         
## c05                .           .           .           .           .         
## c06                .           .           .           .           .         
## c07                0.27054885  0.27709096  0.28512098  0.29283428  0.30032955
## c08                .           .           .           .           .         
## c09                .           .           .           .           .         
## c10                0.15910997  0.16135170  0.17126834  0.18728166  0.20080122
## c11                .           .           .           .           .         
## c12                .           .           .           .           .         
##                                                                      
##                    0.0500250256  0.040622720  0.02630125  0.008189218
## danceability       0.4641601993  0.574723006  0.70860556  0.843816237
## energy             .             .            .           .          
## loudness           .             .            .           .          
## speechiness        .             .            .           .          
## acousticness      -0.5960400479 -0.717109558 -0.86792961 -1.026749424
## instrumentalness   .             .            .           .          
## liveness           .             .            .           .          
## valence           -0.0007163294 -0.014283168 -0.05083867 -0.064326085
## tempo              0.1633051515  0.145141743  0.12550211  0.100053038
## track.duration_ms  .             .            .           .          
## C                  .             .            .           .          
## `C#|Db`            .             .            .           .          
## D                  .             .            .           .          
## `D#|Eb`            0.4395964733  0.479594910  0.54183114  0.606846711
## E                  .             .            .           0.040862686
## F                  .             .            .           .          
## `F#|Gb`            .             .            .           .          
## G                  .             .            .           .          
## `G#|Ab`            .             .            .           .          
## A                 -0.1832040212 -0.216662400 -0.25899114 -0.310522598
## `A#|Bb`           -0.2624982971 -0.275298948 -0.27737173 -0.249832311
## B                  .             .            .           .          
## c01                .             .            .           .          
## c02                .             .            .           .          
## c03                0.4503347626  0.457940051  0.47070680  0.488686453
## c04                .             .            .           .          
## c05                .             .            .           .          
## c06                .             .            .           .          
## c07                0.3044118984  0.307865412  0.31589951  0.320155033
## c08                .             .            .           .          
## c09                .             .            .           .          
## c10                0.2119766113  0.227309091  0.27685339  0.322167122
## c11                .             0.001982773  0.03070870  0.050496591
## c12                .             .            .           .          
##                                                                              
##                   -0.01294055 -0.03967657 -0.07407117 -0.11156180 -0.15039268
## danceability       0.96499960  1.06341603  1.17230186  1.29509767  1.42175447
## energy             .           .           .           .           .         
## loudness           .           .           .           .           .         
## speechiness        .           .           .           .           .         
## acousticness      -1.17898591 -1.34261281 -1.52618596 -1.74051323 -1.98923809
## instrumentalness   .           .          -0.02043282 -0.05091426 -0.07170981
## liveness           .           .           .          -0.02646954 -0.06601777
## valence           -0.07756658 -0.10367980 -0.13275100 -0.16163595 -0.19374980
## tempo              0.07621244  0.05570817  0.03968835  0.02828565  0.02162203
## track.duration_ms  .           .           .           .           .         
## C                  .           .           .           .           .         
## `C#|Db`            .           .           .           .           .         
## D                  .           .           .           .           .         
## `D#|Eb`            0.64282638  0.66811815  0.71409273  0.78722554  0.86715497
## E                  0.06956750  0.09429964  0.10984705  0.11213913  0.09898559
## F                  .           .           .           .           .         
## `F#|Gb`            .           .           .           .           .         
## G                  .           .           .           .           .         
## `G#|Ab`            .           .           .           .           .         
## A                 -0.37270999 -0.43099342 -0.48669632 -0.53864247 -0.58410982
## `A#|Bb`           -0.23918039 -0.22821905 -0.23412738 -0.26710817 -0.30749105
## B                  .           .           .           .           .         
## c01                .           .           .           .           .         
## c02                .           .           .           .           .         
## c03                0.51734244  0.54827392  0.58587769  0.62753291  0.66766712
## c04                .           .           .           .           .         
## c05                .           .           .           .           .         
## c06                .           .           .           .           .         
## c07                0.32878091  0.33813658  0.35148321  0.36891304  0.38868809
## c08                .           .           .           .           .         
## c09                .           .           .           .           .         
## c10                0.37572492  0.43001496  0.48689981  0.54624891  0.60390147
## c11                0.06323465  0.08147023  0.09508194  0.09214969  0.07505494
## c12                .           .           .           .           .         
##                                                                     
##                   -0.19359747 -0.244386093 -0.2945729429 -0.34737707
## danceability       1.55928609  1.703882624  1.8482090104  2.03689800
## energy             .           .            .             .         
## loudness           .           .            .             .         
## speechiness        .           .            .             .         
## acousticness      -2.25196326 -2.530025033 -2.7881200589 -3.03414449
## instrumentalness  -0.08698410 -0.096788073 -0.1095633816 -0.12423763
## liveness          -0.11095756 -0.160624733 -0.2075105464 -0.26357790
## valence           -0.22970828 -0.276725666 -0.3228995928 -0.34258452
## tempo              0.01049226  0.001504558  0.0007865707  0.01654843
## track.duration_ms  .           .            .             .         
## C                  .           .            .             .         
## `C#|Db`            .           .            .             .         
## D                  .          -0.002132657 -0.0251825441 -0.07078610
## `D#|Eb`            0.95631930  1.060548107  1.1615307828  1.28067361
## E                  0.08895343  0.083622515  0.0806385232  0.08689251
## F                  .           .            .             .         
## `F#|Gb`            .           .            .             .         
## G                  .           .            .             .         
## `G#|Ab`            .           .            .             .         
## A                 -0.62709207 -0.659425573 -0.6919573860 -0.73265610
## `A#|Bb`           -0.35036234 -0.388139111 -0.4211398602 -0.46263832
## B                  .           .            .             .         
## c01                .           .            .             .         
## c02                .           .            .             .         
## c03                0.70977472  0.728049395  0.7305215785  0.82571653
## c04                .           .            .            -0.10529674
## c05                .           .            .             .         
## c06                .           .            .             .         
## c07                0.40825952  0.434907799  0.4720385641  0.51889858
## c08                .           .            .             .         
## c09                .           .            .            -0.04312021
## c10                0.67109832  0.743816395  0.8068551648  0.87350295
## c11                0.03448914  .            .             .         
## c12                .           .            .             .         
##                                                                             
##                   -0.40240783 -0.46368427 -0.53198476 -0.6097099 -0.69815106
## danceability       2.23312758  2.42443522  2.61338992  2.7950399  2.98739381
## energy             .           .           .           .          .         
## loudness           .           .           .           .          .         
## speechiness        .           .           .           .          .         
## acousticness      -3.27926840 -3.54571882 -3.82683128 -4.1366859 -4.46543612
## instrumentalness  -0.13738656 -0.16309649 -0.20135959 -0.2371025 -0.27757746
## liveness          -0.32208721 -0.37886852 -0.43874798 -0.5029965 -0.56317443
## valence           -0.35406275 -0.36677798 -0.38160704 -0.3906829 -0.41442902
## tempo              0.04044881  0.06635749  0.09787480  0.1318771  0.14291269
## track.duration_ms  .           .           .           .          .         
## C                  .           .           .           .          .         
## `C#|Db`            .           .           .           .          0.04770338
## D                 -0.12150704 -0.18079378 -0.23699675 -0.2876174 -0.33613632
## `D#|Eb`            1.40028940  1.51286019  1.60425589  1.6928016  1.81907357
## E                  0.09977340  0.09814750  0.09911826  0.1024158  0.13064218
## F                  .           .           .           .          .         
## `F#|Gb`            .           .           .           .          .         
## G                  .           .           .           .          .         
## `G#|Ab`            .           .           .           .          .         
## A                 -0.77751864 -0.82372031 -0.84786970 -0.8587489 -0.85847215
## `A#|Bb`           -0.50312666 -0.55871424 -0.62257880 -0.6882138 -0.72450577
## B                  .           .           .           .          .         
## c01                .           .           .           .          .         
## c02                .           .           .           .          .         
## c03                0.94279414  1.05619472  1.15809762  1.2494953  1.35326471
## c04               -0.23405494 -0.35500437 -0.46652732 -0.5721079 -0.67949476
## c05                .           .           .           .          .         
## c06                .           .           .           .          .         
## c07                0.56911161  0.62367659  0.68520087  0.7510728  0.79323107
## c08                .           .           .           .          .         
## c09               -0.09257955 -0.13935159 -0.18635394 -0.2242196 -0.26202541
## c10                0.94288443  1.01716485  1.09854130  1.1809998  1.26803813
## c11                .           .           .           .          .         
## c12                .           .           .           .          .         
##                                                                         
##                   -0.7917912 -0.8895228 -0.9878082 -1.0851124 -1.1819197
## danceability       3.1777419  3.3721260  3.5670767  3.7607436  3.9363049
## energy             .          .          .          .          .        
## loudness           .          .          .          .          .        
## speechiness        .          .          .          .          .        
## acousticness      -4.8117213 -5.1704743 -5.5335230 -5.8987560 -6.2573890
## instrumentalness  -0.3086605 -0.3362563 -0.3616365 -0.3845658 -0.4079570
## liveness          -0.6278812 -0.6950815 -0.7629862 -0.8317351 -0.8987394
## valence           -0.4310421 -0.4472826 -0.4652821 -0.4848383 -0.4940300
## tempo              0.1523523  0.1560146  0.1530059  0.1461075  0.1414182
## track.duration_ms  .          .          .          .          .        
## C                  .          .          .          .          .        
## `C#|Db`            0.1050417  0.1772738  0.2640871  0.3618592  0.4603019
## D                 -0.3749079 -0.4101336 -0.4401955 -0.4642359 -0.4896150
## `D#|Eb`            1.9646257  2.1296096  2.3095528  2.5012243  2.6942974
## E                  0.1714914  0.2296231  0.3063959  0.3992579  0.4942599
## F                  .          .          .          .          .        
## `F#|Gb`            .          .          .          .          .        
## G                  .          .          .          .          .        
## `G#|Ab`            .          .          .          .          .        
## A                 -0.8535873 -0.8539644 -0.8622574 -0.8783578 -0.8964340
## `A#|Bb`           -0.7513058 -0.7634266 -0.7579948 -0.7374664 -0.7164064
## B                  .          .          .          .          .        
## c01                .          .          .          .          .        
## c02                .          .          .          .          .        
## c03                1.4830627  1.6308497  1.7912762  1.9586182  2.1223077
## c04               -0.8084040 -0.9464690 -1.0874395 -1.2278742 -1.3630575
## c05                .          .          .          .          .        
## c06                .          .          .          .          .        
## c07                0.8213217  0.8451554  0.8646980  0.8809350  0.8983985
## c08                .          .          .          .          .        
## c09               -0.2966634 -0.3344870 -0.3782162 -0.4284476 -0.4707542
## c10                1.3487206  1.4339691  1.5253663  1.6221956  1.7168204
## c11                .          .          .          .          .        
## c12                .          .          .          .          .        
##                                                                            
##                   -1.2775001 -1.3719610 -1.4652598 -1.558866581 -1.65795697
## danceability       4.1079753  4.2796679  4.4511652  4.625310457  4.80214411
## energy             .          .          .          .            .         
## loudness           .          .          .          0.005355636  0.02160062
## speechiness        .          .          .          .            .         
## acousticness      -6.6099474 -6.9583080 -7.3018780 -7.643553081 -7.99339112
## instrumentalness  -0.4310820 -0.4541921 -0.4775459 -0.500209467 -0.51975277
## liveness          -0.9641977 -1.0283783 -1.0910859 -1.151344510 -1.20656920
## valence           -0.5003126 -0.5065845 -0.5124685 -0.521079462 -0.53508108
## tempo              0.1412373  0.1423092  0.1462907  0.148343250  0.14137496
## track.duration_ms  .          .          .          .            .         
## C                  .          .          .          .            .         
## `C#|Db`            0.5521555  0.6416523  0.7256701  0.810823406  0.90759484
## D                 -0.5159187 -0.5419763 -0.5684575 -0.595252442 -0.62740182
## `D#|Eb`            2.8830968  3.0710323  3.2547089  3.440664500  3.63620763
## E                  0.5834919  0.6714227  0.7545606  0.839526184  0.92943269
## F                  .          .          .          .            .         
## `F#|Gb`            .          .          .          .            .         
## G                  .          .          .          .            .         
## `G#|Ab`            .          .          .          .            .         
## A                 -0.9155167 -0.9363708 -0.9574267 -0.980128354 -1.00290964
## `A#|Bb`           -0.7007675 -0.6861827 -0.6759398 -0.663710729 -0.64275654
## B                  .          .          .          .            .         
## c01                .          .          .          .            .         
## c02                .          .          .          .            .         
## c03                2.2838157  2.4458053  2.6062030  2.767841982  2.93558726
## c04               -1.4969586 -1.6305388 -1.7634634 -1.898157013 -2.03591459
## c05                .          .          .          .            .         
## c06                .          .          .          .            .         
## c07                0.9172082  0.9363002  0.9564108  0.975450481  0.99013036
## c08                .          .          .          .            .         
## c09               -0.5088062 -0.5462235 -0.5821624 -0.620815055 -0.66132651
## c10                1.8076903  1.8972871  1.9844162  2.071877565  2.16459493
## c11                .          .          .          .            .         
## c12                .          .          .          .            .         
##                                                                             
##                   -1.75663248 -1.85462157 -1.95156087 -2.04743802 -2.1419509
## danceability       4.98018634  5.15984118  5.34017043  5.52109970  5.7011935
## energy             .           .           .           .           .        
## loudness           0.03892651  0.05708787  0.07524037  0.09320092  0.1108185
## speechiness        .           .           .           .           .        
## acousticness      -8.33511893 -8.67222748 -9.00341009 -9.32932206 -9.6501448
## instrumentalness  -0.54139855 -0.56375889 -0.58709373 -0.61101397 -0.6351256
## liveness          -1.25933141 -1.31071816 -1.36096232 -1.41024793 -1.4587110
## valence           -0.54755283 -0.56059313 -0.57292843 -0.58485034 -0.5961600
## tempo              0.13560185  0.12882579  0.12317953  0.11856911  0.1152829
## track.duration_ms  .           .           .           .           .        
## C                  .           .           .           .           .        
## `C#|Db`            1.00299288  1.09951235  1.19339857  1.28492096  1.3736525
## D                 -0.66161430 -0.69622290 -0.73190088 -0.76855492 -0.8058075
## `D#|Eb`            3.82731244  4.01877482  4.20766053  4.39474437  4.5798224
## E                  1.01978190  1.11192868  1.20189742  1.28933846  1.3734216
## F                  .           .           .           .           .        
## `F#|Gb`            .           .           .           .           .        
## G                  .           .           .           .           .        
## `G#|Ab`            .           .           .           .           .        
## A                 -1.02631196 -1.05116835 -1.07582671 -1.10034226 -1.1244868
## `A#|Bb`           -0.62204518 -0.59955053 -0.57938213 -0.56155986 -0.5465029
## B                  .           .           .           .           .        
## c01                .           .           .           .           .        
## c02                .           .           .           .           .        
## c03                3.10337863  3.27196415  3.43979846  3.60691116  3.7718297
## c04               -2.17576071 -2.31637909 -2.45763778 -2.59921673 -2.7397083
## c05                .           .           .           .           .        
## c06                .           .           .           .           .        
## c07                1.00576845  1.02125488  1.03720094  1.05358509  1.0706026
## c08                .           .           .           .           .        
## c09               -0.70162829 -0.74256636 -0.78215688 -0.82004838 -0.8557309
## c10                2.25617260  2.34767294  2.43707558  2.52441105  2.6095106
## c11                .           .           .           .           .        
## c12                .           .           .           .           .        
##                                                                               
##                   -2.2352658  -2.3278423  -2.4184581  -2.51269809  -2.60513807
## danceability       5.8815733   6.0628778   6.2432882   6.43438635   6.62471046
## energy             .           .           .           .            .         
## loudness           0.1280276   0.1447838   0.1601493   0.17792608   0.19598956
## speechiness        .           .           .           .            .         
## acousticness      -9.9660774 -10.2787343 -10.5846050 -10.89180132 -11.19067577
## instrumentalness  -0.6594216  -0.6840686  -0.7091094  -0.73563756  -0.76175749
## liveness          -1.5064674  -1.5535771  -1.5998093  -1.64312714  -1.68459946
## valence           -0.6073792  -0.6182327  -0.6288904  -0.64686957  -0.66740280
## tempo              0.1139636   0.1134247   0.1166161   0.11976433   0.12786311
## track.duration_ms  .           .           .           .            .         
## C                  .           .           .           .            .         
## `C#|Db`            1.4597061   1.5440450   1.6241309   1.70550750   1.77795815
## D                 -0.8439656  -0.8829337  -0.9228394  -0.96711077  -1.01345232
## `D#|Eb`            4.7636171   4.9463029   5.1240073   5.30305290   5.47177437
## E                  1.4539346   1.5320110   1.6056776   1.67938490   1.74482788
## F                  .           .           .           .            .         
## `F#|Gb`            .           .           .           .            .         
## G                  .           .           .           .            .         
## `G#|Ab`            .           .           .           .            .         
## A                 -1.1482054  -1.1717693  -1.1946776  -1.21714632  -1.23732900
## `A#|Bb`           -0.5345325  -0.5245988  -0.5184001  -0.51266963  -0.51423574
## B                  .           .           .           .            .         
## c01                .           .           .           .            .         
## c02                .           .           .           .            .         
## c03                3.9355936   4.0999573   4.2619575   4.42728134   4.58324422
## c04               -2.8799180  -3.0208964  -3.1605829  -3.30012468  -3.43245129
## c05                .           .           .           .            .         
## c06                .           .           .           .            .         
## c07                1.0885174   1.1066048   1.1262078   1.14480719   1.16487368
## c08                .           .           .           0.01315004   0.03560295
## c09               -0.8892099  -0.9213956  -0.9520959  -0.98640065  -1.02119086
## c10                2.6924221   2.7737828   2.8529814   2.93252474   3.00823399
## c11                .           .           .           .            .         
## c12                .           .           .           .            .         
##                                                                      
##                    -2.69858246  -2.78604884  -2.8778607 -2.965820e+00
## danceability        6.81642008   6.99811977   7.1853164  7.367337e+00
## energy              .            .            .          .           
## loudness            0.21760673   0.23792950   0.2601906  2.819023e-01
## speechiness         .            .            .          .           
## acousticness      -11.49296926 -11.78206399 -12.0816517 -1.236897e+01
## instrumentalness   -0.78736186  -0.81156266  -0.8363480 -8.598759e-01
## liveness           -1.72671321  -1.76686940  -1.8074320 -1.844782e+00
## valence            -0.69032888  -0.71101590  -0.7339525 -7.569945e-01
## tempo               0.13351090   0.14290798   0.1486776  1.565193e-01
## track.duration_ms   .            .            .          .           
## C                   .            .            .          .           
## `C#|Db`             1.85232422   1.91616595   1.9840299  2.045273e+00
## D                  -1.05878054  -1.10279971  -1.1463028 -1.189873e+00
## `D#|Eb`             5.64641058   5.80823864   5.9806705  6.142572e+00
## E                   1.81238857   1.86976383   1.9309175  1.985860e+00
## F                   .            .            .          .           
## `F#|Gb`             .            .            .          .           
## G                   .            .            .          .           
## `G#|Ab`             .            .            .          .           
## A                  -1.25971142  -1.28016977  -1.3023071 -1.322788e+00
## `A#|Bb`            -0.51409467  -0.52150964  -0.5276127 -5.378771e-01
## B                   .            .            .          .           
## c01                 .            .            .          .           
## c02                 .            .            .          .           
## c03                 4.73698974   4.87978063   5.0273681  5.169908e+00
## c04                -3.56202692  -3.68461456  -3.8092487 -3.929604e+00
## c05                 .            .            .          2.256851e-04
## c06                 .            .            .          .           
## c07                 1.18271737   1.20256757   1.2210880  1.240774e+00
## c08                 0.05923173   0.08283023   0.1059526  1.307837e-01
## c09                -1.05682078  -1.08997666  -1.1243984 -1.158854e+00
## c10                 3.08430791   3.15473731   3.2261997  3.293777e+00
## c11                 .            .            .          .           
## c12                 .            .            .          .           
##                                                                        
##                    -3.05356137  -3.136896087  -3.220160895  -3.30058143
## danceability        7.55038824   7.726083412   7.904284238   8.08134455
## energy              .            .             .             .         
## loudness            0.30377215   0.323205637   0.341962852   0.36030208
## speechiness         .            .             .             .         
## acousticness      -12.66048182 -12.941651068 -13.221899185 -13.49760385
## instrumentalness   -0.88221020  -0.903009478  -0.923185858  -0.94248682
## liveness           -1.88421569  -1.922222330  -1.959633061  -1.99690316
## valence            -0.77976068  -0.800158572  -0.820924378  -0.84042781
## tempo               0.16384685   0.173517596   0.185558846   0.19909654
## track.duration_ms   .            .             .             .         
## C                   .            .             .             .         
## `C#|Db`             2.10816232   2.165176504   2.218213077   2.26922667
## D                  -1.23211699  -1.273572844  -1.316465079  -1.35897447
## `D#|Eb`             6.31137343   6.472117729   6.630676052   6.78985087
## E                   2.04101216   2.090264744   2.133580218   2.17142162
## F                   .            .             .             .         
## `F#|Gb`             .            .             .             .         
## G                   .            .             .             .         
## `G#|Ab`             .            .             .             .         
## A                  -1.34486037  -1.365315104  -1.385522642  -1.40613988
## `A#|Bb`            -0.54820864  -0.562426444  -0.581941047  -0.60483642
## B                   .            .             .             .         
## c01                 .            .             .             .         
## c02                 .            .             .             .         
## c03                 5.31489960   5.453640721   5.594932908   5.73701786
## c04                -4.05240319  -4.171271280  -4.291708071  -4.41178697
## c05                 0.00283815   0.006492072   0.008868984   0.01057208
## c06                 .            .             .             .         
## c07                 1.25978064   1.279890261   1.301335424   1.32291332
## c08                 0.15344580   0.175428804   0.196988880   0.21550662
## c09                -1.19249853  -1.224373506  -1.254543921  -1.28193724
## c10                 3.36043141   3.423238129   3.484337960   3.54298563
## c11                 .            .             .             .         
## c12                 .            .             .             .         
##                                                                      
##                    -3.37831275  -3.45398091  -3.53270200  -3.60588979
## danceability        8.25227523   8.42117607   8.59477491   8.75878604
## energy              .            .            .            .         
## loudness            0.37580368   0.39007444   0.40683374   0.42083444
## speechiness         .            .            .            .         
## acousticness      -13.76856426 -14.03678165 -14.31490620 -14.57843930
## instrumentalness   -0.96054249  -0.97716781  -0.99283544  -1.00666907
## liveness           -2.03418117  -2.07215615  -2.11302455  -2.15136871
## valence            -0.85691638  -0.87043939  -0.88354936  -0.89346771
## tempo               0.21517069   0.23316060   0.25272911   0.27356472
## track.duration_ms   .            .            .            .         
## C                   .            .            .            .         
## `C#|Db`             2.31511805   2.35774508   2.40203023   2.44021448
## D                  -1.40044356  -1.44162449  -1.48328801  -1.52339424
## `D#|Eb`             6.94288559   7.09415215   7.25432233   7.40091936
## E                   2.20478695   2.23231230   2.26018042   2.28239463
## F                   .            .            .            .         
## `F#|Gb`             .            .            .            .         
## G                   .            .            .            .         
## `G#|Ab`             .            .            .            .         
## A                  -1.42606725  -1.44486712  -1.46560002  -1.48409467
## `A#|Bb`            -0.63113223  -0.66189263  -0.69366638  -0.72770710
## B                   .            .            .            .         
## c01                 .            .            .            .         
## c02                 .            .            .            .         
## c03                 5.87527711   6.01329135   6.15778708   6.29482415
## c04                -4.52962649  -4.64829885  -4.77248582  -4.89283446
## c05                 0.01322264   0.01559893   0.02005082   0.02400357
## c06                 .            .            .            .         
## c07                 1.34566649   1.36870851   1.39237816   1.41617393
## c08                 0.23238562   0.24694682   0.25983021   0.27187756
## c09                -1.30711304  -1.32819931  -1.34901058  -1.36720180
## c10                 3.59891459   3.65161465   3.70506274   3.75410678
## c11                 .            .            .            .         
## c12                 .            .            .            .         
##                                                                         
##                    -3.67981599  -3.752006718 -3.823514e+00  -3.895432721
## danceability        8.92250490   9.080382683  9.236575e+00   9.396555689
## energy              .            .            .              .          
## loudness            0.43586759   0.451616008  4.683505e-01   0.488284484
## speechiness         .            .            .              .          
## acousticness      -14.84846004 -15.113567480 -1.537344e+01 -15.636939463
## instrumentalness   -1.02149385  -1.035193289 -1.047763e+00  -1.060248165
## liveness           -2.19177130  -2.231053400 -2.270167e+00  -2.311824164
## valence            -0.90245910  -0.909266379 -9.122771e-01  -0.913631289
## tempo               0.29568162   0.317396096  3.391076e-01   0.361457292
## track.duration_ms   .           -0.001574958 -8.056557e-03  -0.019672019
## C                   .            .            .              .          
## `C#|Db`             2.48033996   2.519062657  2.553022e+00   2.585679957
## D                  -1.56348289  -1.602588000 -1.640982e+00  -1.680013088
## `D#|Eb`             7.55632305   7.709475093  7.856923e+00   8.008552229
## E                   2.30483399   2.324708104  2.338442e+00   2.349759628
## F                   .            .            .              .          
## `F#|Gb`             .            .            .              .          
## G                   .            .            .              .          
## `G#|Ab`             .            .            .              .          
## A                  -1.50436090  -1.523882209 -1.541203e+00  -1.557172137
## `A#|Bb`            -0.76262822  -0.798664781 -8.392305e-01  -0.882936282
## B                   .            .            .              .          
## c01                 .            .           -6.499905e-04  -0.005185473
## c02                 .            .            .              .          
## c03                 6.43509206   6.573226435  6.712212e+00   6.858052210
## c04                -5.01457296  -5.135822800 -5.259410e+00  -5.390329646
## c05                 0.02940339   0.036200508  4.256409e-02   0.049752716
## c06                 .            .            .              .          
## c07                 1.44037476   1.464071000  1.487552e+00   1.512614859
## c08                 0.27936963   0.285740498  2.918661e-01   0.293253500
## c09                -1.38432763  -1.399232770 -1.411082e+00  -1.422293164
## c10                 3.80279659   3.847964109  3.887340e+00   3.924507445
## c11                 .            .            .              .          
## c12                 .            .            .              .          
##                                                                      
##                    -3.96567539  -4.03408864  -4.10580614  -4.17171897
## danceability        9.55574746   9.71414047   9.88046327  10.03642219
## energy              .            .            .            .         
## loudness            0.51164678   0.53834948   0.57049022   0.60020085
## speechiness         .            .            .            .         
## acousticness      -15.90087717 -16.16311796 -16.43730398 -16.68672654
## instrumentalness   -1.07126049  -1.08112796  -1.08934629  -1.10167479
## liveness           -2.35278214  -2.39388634  -2.43648740  -2.47927510
## valence            -0.91579878  -0.91797867  -0.92178933  -0.92943938
## tempo               0.38494647   0.40783912   0.43108992   0.44689480
## track.duration_ms  -0.03401620  -0.05184069  -0.07304247  -0.09554273
## C                   .            .            .            .         
## `C#|Db`             2.61758377   2.64946562   2.68496834   2.72607384
## D                  -1.71893840  -1.75708564  -1.79652460  -1.83241902
## `D#|Eb`             8.16258673   8.31861752   8.48778688   8.64956028
## E                   2.35569061   2.35812390   2.35784721   2.37849299
## F                   .            .            .            .         
## `F#|Gb`             .            .            .            .         
## G                   .            .            .            .         
## `G#|Ab`             .            .            .            .         
## A                  -1.57207708  -1.58651968  -1.60218354  -1.62088763
## `A#|Bb`            -0.93068637  -0.98072550  -1.03284668  -1.06871380
## B                   .            .            .            .         
## c01                -0.01566726  -0.03134740  -0.04851054  -0.05754167
## c02                 .            .            .            .         
## c03                 7.00713052   7.15984953   7.32348658   7.47275852
## c04                -5.52439479  -5.66181564  -5.80724548  -5.94704279
## c05                 0.05782780   0.06670591   0.07827762   0.09632834
## c06                 .            .            .            .         
## c07                 1.53910841   1.56588762   1.59259951   1.61405666
## c08                 0.29311163   0.29050319   0.28634466   0.28650056
## c09                -1.43156377  -1.43862951  -1.44501490  -1.46115854
## c10                 3.95913199   3.99043573   4.02113797   4.05151309
## c11                 .            .            .            .         
## c12                 .            .            .            .         
##                                                                    
##                    -4.23887330  -4.30588612  -4.3717364  -4.4401419
## danceability       10.19327252  10.34734335  10.5005067  10.6603918
## energy              .            .            .           .        
## loudness            0.63462569   0.67119711   0.7118047   0.7577481
## speechiness         .            .            .           .        
## acousticness      -16.93929156 -17.19096438 -17.4376010 -17.6914865
## instrumentalness   -1.11156838  -1.12087864  -1.1287230  -1.1363681
## liveness           -2.52089506  -2.56145158  -2.6012637  -2.6424240
## valence            -0.93655948  -0.94444055  -0.9499490  -0.9561095
## tempo               0.46316841   0.47977093   0.4968190   0.5141302
## track.duration_ms  -0.11854654  -0.14191889  -0.1673093  -0.1962839
## C                   .            .            .           .        
## `C#|Db`             2.76768162   2.80964710   2.8528804   2.8974800
## D                  -1.86872827  -1.90497880  -1.9412912  -1.9796737
## `D#|Eb`             8.81154585   8.97340918   9.1314635   9.2971031
## E                   2.39487348   2.40988164   2.4228818   2.4339264
## F                   .            .            .           .        
## `F#|Gb`             .            .            .           .        
## G                   .            .            .           .        
## `G#|Ab`             .            .            .           .        
## A                  -1.63785135  -1.65434018  -1.6692528  -1.6843241
## `A#|Bb`            -1.10749096  -1.14686189  -1.1855127  -1.2274521
## B                   .            .            .           .        
## c01                -0.07262948  -0.08968489  -0.1107382  -0.1336014
## c02                 .            .            .           .        
## c03                 7.62496228   7.77596404   7.9294181   8.0912887
## c04                -6.09094923  -6.23443291  -6.3799845  -6.5328500
## c05                 0.11477089   0.13432816   0.1549084   0.1765725
## c06                 .            .            .           .        
## c07                 1.63464307   1.65395503   1.6724582   1.6907091
## c08                 0.28549511   0.28396981   0.2807228   0.2757688
## c09                -1.47507004  -1.48766539  -1.4988809  -1.5104625
## c10                 4.08002025   4.10689173   4.1313973   4.1554476
## c11                 .            .            .           .        
## c12                 .            .            .           .        
##                                                                          
##                   -4.505506e+00 -4.534746e+00 -4.573720e+00 -4.607480e+00
## danceability       1.081861e+01  1.092186e+01  1.106616e+01  1.120979e+01
## energy             .             .             .            -1.908506e-04
## loudness           8.080963e-01  8.467776e-01  8.928080e-01  9.422986e-01
## speechiness        .             .             .             .           
## acousticness      -1.793064e+01 -1.807091e+01 -1.825085e+01 -1.841710e+01
## instrumentalness  -1.144149e+00 -1.150969e+00 -1.162199e+00 -1.173932e+00
## liveness          -2.679273e+00 -2.702826e+00 -2.731314e+00 -2.760133e+00
## valence           -9.648256e-01 -9.778291e-01 -9.853715e-01 -9.935167e-01
## tempo              5.296286e-01  5.360728e-01  5.472136e-01  5.554175e-01
## track.duration_ms -2.307583e-01 -2.579652e-01 -2.854954e-01 -3.130431e-01
## C                  .             .             .             .           
## `C#|Db`            2.940885e+00  2.969217e+00  2.997293e+00  3.020875e+00
## D                 -2.016292e+00 -2.041660e+00 -2.069398e+00 -2.096867e+00
## `D#|Eb`            9.459823e+00  9.563878e+00  9.687273e+00  9.811587e+00
## E                  2.440202e+00  2.441235e+00  2.449732e+00  2.457929e+00
## F                  .             .             .             .           
## `F#|Gb`            .             .             .             .           
## G                  .             .             .             .           
## `G#|Ab`            .             .             .             .           
## A                 -1.696605e+00 -1.703510e+00 -1.711519e+00 -1.720313e+00
## `A#|Bb`           -1.270453e+00 -1.304618e+00 -1.340447e+00 -1.377298e+00
## B                  .             .             .             .           
## c01               -1.640441e-01 -1.985202e-01 -2.465101e-01 -2.923522e-01
## c02                .             .             .             .           
## c03                8.252743e+00  8.358306e+00  8.483919e+00  8.606298e+00
## c04               -6.682942e+00 -6.786998e+00 -6.911306e+00 -7.034393e+00
## c05                1.971135e-01  2.088314e-01  2.240054e-01  2.381551e-01
## c06                .             .             .             .           
## c07                1.707136e+00  1.721672e+00  1.754895e+00  1.792570e+00
## c08                2.715660e-01  2.733709e-01  2.691998e-01  2.625466e-01
## c09               -1.521192e+00 -1.525106e+00 -1.533208e+00 -1.542498e+00
## c10                4.175711e+00  4.184659e+00  4.203365e+00  4.222467e+00
## c11                .             .             .             .           
## c12                6.150889e-05  1.215092e-04  1.516568e-04  2.913419e-04
##                                                                          
##                   -4.666193e+00 -4.690661e+00 -4.715835e+00  -4.791366102
## danceability       1.138124e+01  1.154163e+01  1.168897e+01  11.880296775
## energy             .            -1.339834e-02 -3.107019e-02  -0.033129305
## loudness           1.005632e+00  1.071925e+00  1.135802e+00   1.213922101
## speechiness        .             .             .              0.022254558
## acousticness      -1.865035e+01 -1.880490e+01 -1.895647e+01 -19.212544689
## instrumentalness  -1.173992e+00 -1.188315e+00 -1.199832e+00  -1.201215485
## liveness          -2.794859e+00 -2.825342e+00 -2.848895e+00  -2.887151258
## valence           -9.902153e-01 -1.005951e+00 -1.029402e+00  -1.038851626
## tempo              5.648692e-01  5.701735e-01  5.726496e-01   0.574976887
## track.duration_ms -3.419948e-01 -3.800601e-01 -4.153261e-01  -0.451027006
## C                  .             .             .              .          
## `C#|Db`            3.054212e+00  3.069293e+00  3.090385e+00   3.144934394
## D                 -2.125222e+00 -2.155920e+00 -2.180745e+00  -2.211595360
## `D#|Eb`            9.939678e+00  1.008250e+01  1.022111e+01  10.354414212
## E                  2.451747e+00  2.451188e+00  2.453041e+00   2.450575531
## F                  .             .             .              .          
## `F#|Gb`            .             .             .              .          
## G                  .             .             .              .          
## `G#|Ab`            .             .             .              .          
## A                 -1.732642e+00 -1.739532e+00 -1.751946e+00  -1.765771581
## `A#|Bb`           -1.428150e+00 -1.473387e+00 -1.513608e+00  -1.564152774
## B                  .             .             .              .          
## c01               -3.689428e-01 -4.026592e-01 -4.365425e-01  -0.531671874
## c02                .             .             .              .          
## c03                8.779523e+00  8.904957e+00  9.026508e+00   9.233196714
## c04               -7.197661e+00 -7.327904e+00 -7.449881e+00  -7.634705067
## c05                2.505782e-01  2.612837e-01  2.708456e-01   0.282287039
## c06                .             .             .              .          
## c07                1.833425e+00  1.868429e+00  1.904048e+00   1.948335436
## c08                2.438494e-01  2.344519e-01  2.216444e-01   0.192805111
## c09               -1.540909e+00 -1.556337e+00 -1.572055e+00  -1.579054163
## c10                4.237437e+00  4.255092e+00  4.269727e+00   4.275900065
## c11                .             .             .              .          
## c12                3.717348e-04  7.191704e-04  8.126196e-04   0.001336584

Decision Trees

Decision trees are nicely intuitive, and perform somewhat better here.

indie_tree <- decision_tree(mode = 'classification') %>% set_engine('C5.0')
predict_tree <- function(split)
    fit(indie_tree, playlist ~ ., data = analysis(split)) %>% 
    predict(assessment(split), type = 'class') %>%
    bind_cols(assessment(split))
indie_cv %>% 
    mutate(pred = map(splits, predict_tree)) %>% unnest(pred) %>% 
    metric_set(accuracy, kap, j_index)(truth = playlist, estimate = .pred_class)
## # A tibble: 3 × 3
##   .metric  .estimator .estimate
##   <chr>    <chr>          <dbl>
## 1 accuracy multiclass      0.5 
## 2 kap      multiclass      0.25
## 3 j_index  macro           0.25

We can look at the whole tree with the summary command. Be careful not to read too much into the actual numerical values, however: remember that the features were standardised before we started classification. Without cross-validation, the algorithm looks much better from the summary than it actually was in practice, but we can still see that timbre features are important and chroma features probably aren’t.

indie_class %>% 
    fit(indie_tree, playlist ~ ., data = .) %>% 
    pluck('fit') %>%
    summary
## 
## Call:
## C5.0.default(x = x, y = y, trials = 1, control = C50::C5.0Control(minCases =
##  2, sample = 0))
## 
## 
## C5.0 [Release 2.07 GPL Edition]      Wed Feb 22 00:26:02 2023
## -------------------------------
## 
## Class specified by attribute `outcome'
## 
## Read 60 cases (35 attributes) from undefined.data
## 
## Decision tree:
## 
## acousticness > -0.02638207:
## :...danceability <= 1.054778: Indie Pop (14)
## :   danceability > 1.054778: Indie Party (5/1)
## acousticness <= -0.02638207:
## :...D > 1.710655: Indie Pop (2)
##     D <= 1.710655:
##     :...valence <= -1.325073: Indie Pop (2)
##         valence > -1.325073:
##         :...track.duration_ms <= -1.345573: Indie Party (4)
##             track.duration_ms > -1.345573:
##             :...F <= -0.4323367: Indie x Running (10/1)
##                 F > -0.4323367:
##                 :...E > 1.100125: Indie x Running (3)
##                     E <= 1.100125:
##                     :...A <= -1.751649: Indie x Running (2)
##                         A > -1.751649:
##                         :...danceability > -0.08712579: Indie Party (6)
##                             danceability <= -0.08712579:
##                             :...c08 <= 0.62099: Indie x Running (6/1)
##                                 c08 > 0.62099: Indie Party (6/1)
## 
## 
## Evaluation on training data (60 cases):
## 
##      Decision Tree   
##    ----------------  
##    Size      Errors  
## 
##      11    4( 6.7%)   <<
## 
## 
##     (a)   (b)   (c)    <-classified as
##    ----  ----  ----
##      19           1    (a): class Indie Party
##       1    18     1    (b): class Indie Pop
##       1          19    (c): class Indie x Running
## 
## 
##  Attribute usage:
## 
##  100.00% acousticness
##   68.33% D
##   65.00% valence
##   61.67% danceability
##   61.67% track.duration_ms
##   55.00% F
##   38.33% E
##   33.33% A
##   20.00% c08
## 
## 
## Time: 0.0 secs

Random Forests

indie_forest <- 
  rand_forest(mode = 'classification') %>% set_engine('randomForest')
predict_forest <- function(split)
    fit(indie_forest, playlist ~ ., data = analysis(split)) %>% 
    predict(assessment(split), type = 'class') %>%
    bind_cols(assessment(split))
indie_cv %>% 
    mutate(pred = map(splits, predict_forest)) %>% 
    unnest(pred) %>% 
    metric_set(accuracy, kap, j_index)(truth = playlist, estimate = .pred_class)
## # A tibble: 3 × 3
##   .metric  .estimator .estimate
##   <chr>    <chr>          <dbl>
## 1 accuracy multiclass     0.483
## 2 kap      multiclass     0.225
## 3 j_index  macro          0.225

Random forests give us the best-quality ranking of feature importance, and we can plot it with randomForest::varImpPlot. Again, it is clear that timbre, specifically Component 1 (power) and Component 11, is important. Note that because random forests are indeed random, the accuracy and feature rankings will vary (slightly) every time you re-run the code.

indie_class %>% 
    fit(indie_forest, playlist ~ ., data = .) %>% 
    pluck('fit') %>% 
    randomForest::varImpPlot()

Feature Selection

Let’s try \(k\)-NN again with just the top features. We see much better results.

predict_knn_reduced <- function(split)
    fit(
        indie_knn, 
        playlist ~ c01 + c11 + liveness + energy + acousticness, 
        data = analysis(split)) %>% 
    predict(assessment(split), type = 'class') %>%
    bind_cols(assessment(split))
indie_cv %>% 
    mutate(pred = map(splits, predict_knn_reduced)) %>% unnest(pred) %>% 
    metric_set(accuracy, kap, j_index)(truth = playlist, estimate = .pred_class)
## # A tibble: 3 × 3
##   .metric  .estimator .estimate
##   <chr>    <chr>          <dbl>
## 1 accuracy multiclass    0.35  
## 2 kap      multiclass    0.0250
## 3 j_index  macro         0.0250
indie_cv %>% 
    mutate(pred = map(splits, predict_knn_reduced)) %>% unnest(pred) %>% 
    conf_mat(truth = playlist, estimate = .pred_class) %>% 
    autoplot(type = 'mosaic')

Armed with this feature set, perhaps we can make a better plot. It’s clear that the workout list has fewer live tracks, and that the party playlist is somewhat louder and higher on Component 11 than the pop list.

indie %>%
    ggplot(aes(x = c01, y = c11, colour = playlist, size = liveness)) +
    geom_point(alpha = 0.8) +
    scale_color_brewer(type = 'qual', palette = 'Accent') +
    labs(x = 'Timbre Component 1', y = 'Timbre Component 11', size = 'Liveness', colour = 'Playlist')

Deltas and Delta-Deltas (Advanced)

Although the novelty-based transformations of chroma and timbre features are not always useful for visualisations, they can be very useful for classification. Both ‘deltas’ and ‘delta-deltas’, especially for timbre features, are in regular use in music information retrieval. The code example below shows how to compute average delta chroma and timbre features instead of the ordinary average. Can you incorporate it into the classifiers above? Can you add delta-deltas, too?

indie_deltas <-
    pop %>% mutate(playlist = "Indie Pop") %>% 
    bind_rows(
        party %>% mutate(playlist = "Indie Party"),
        workout %>% mutate(playlist = "Indie Workout")) %>% 
    mutate(playlist = factor(playlist)) %>% 
    mutate(
        segments = 
            map2(segments, key, compmus_c_transpose)) %>% 
    mutate(
        segments = 
            map(
                segments, 
                mutate, 
                pitches = map(pitches, compmus_normalise, 'manhattan'))) %>% 
    mutate(
        segments =
            map(
                segments,
                mutate,
                pitches = map2(pitches, lag(pitches), `-`))) %>% 
    mutate(
        segments =
            map(
                segments,
                mutate,
                timbre = map2(timbre, lag(timbre), `-`))) %>%
    mutate(
        segments =
            map(
                segments,
                slice,
                -1
            )
    ) %>% 
    mutate(
        pitches =
            map(segments,
                compmus_summarise, pitches,
                method = 'mean', na.rm = TRUE),
        timbre =
            map(
                segments,
                compmus_summarise, timbre,
                method = 'mean', na.rm = TRUE)) %>%
    mutate_at(vars(pitches, timbre), map, bind_rows) %>%
    unnest(cols = c(pitches, timbre))