1 Ekspektasi Maksimalisasi

Di kelas ini kita akan mengimplementasikan algoritma Ekspektasi Maksimalisasi untuk memperkirakan parameter Gaussian Mixture. Metode ini menyediakan pengklasifikasi tanpa pengawasan yang sangat berguna ketika diasumsikan distribusi Gaussian.

Misalkan kita ingin memodelkan parameter populasi yang diasumsikan menjadi salah satu dari dua populasi normal gaussian dengan probabilitas pencampuran \(\pi\).

Itu berarti \(x_i\sim N(\mu_1, \Sigma_1)\) dengan probabilitas \(\pi,x_i\sim N(\mu_2, \Sigma_2)\) dengan probabilitas \((1-\pi)\). Mari kita nyatakan \(\theta_1= (\mu_1, \Sigma_1)\) dan \(\theta_2 = (\mu_2, \Sigma_2)\) parameter dari setiap populasi dan \(\pi\) parameter pencampuran dan \(\phi_1\) dan \(\phi_2\) kepadatan setiap distribusi. Algoritma Ekspektasi Maksimalisasi dapat diringkas dalam langkah-langkah berikut:

  1. Ambil tebakan awal untuk parameternya \(\hat{\mu}_1, \hat{\mu}_2, \hat{\Sigma}_1, \hat{\Sigma}_2, \hat{\pi}\)

  2. Langkah Ekspektasi: Hitung \[\hat{\gamma}_i = \dfrac{\hat{\pi}\phi_1(y_i)}{\hat{\pi}\phi_1(y_i)+(1-\hat{\pi})\phi_2(y_i)}\]

  3. Langkah Maksimalisasi: Hitung mean dan varians tertimbang \[\begin{align*} \hat{\mu_1} & = \dfrac{\sum_{i=1}^n\hat{\gamma}_ix_i}{\sum_{i=1}^n\hat{\gamma}_i} & \hat{\Sigma_1} = \dfrac{1}{n}\dfrac{\sum_{i=1}^n\hat{\gamma}_i(x_i-\mu_1)(x_i-\mu_1)^T}{\sum_{i=1}^n\hat{\gamma}_i}\\ \hat{\mu_2} & = \dfrac{\sum_{i=1}^n(1-\hat{\gamma}_i)x_i}{\sum_{i=1}^n(1-\hat{\gamma}_i)} & \hat{\Sigma_2} = \dfrac{1}{n}\dfrac{\sum_{i=1}^n\hat{\gamma}_i(x_i-\mu_2)(x_i-\mu_2)^T}{\sum_{i=1}^n(1-\hat{\gamma}_i)} \end{align*}\] dan kemungkinan pencampuran \(\hat{\pi} = \dfrac{1}{n}\sum_{i=1}^n\hat{\gamma}_i\)

  4. Ulangi langkah 2 dan 3 hingga konvergen.

1.1 Latihan 1

Simulasikan 300 sampel Gaussian Mixture dengan probabilitas pencampuran sebesar \(\frac {1}{3}\) sebagai berikut: \[\begin{equation*} Y_1 \sim N\bigg(\begin{bmatrix}1\\1\end{bmatrix},\begin{bmatrix}2&1\\1&1\end{bmatrix} \bigg) \qquad Y_2 \sim N\bigg(\begin{bmatrix}7\\7\end{bmatrix},\begin{bmatrix}2&2\\2&5\end{bmatrix} \bigg) \end{equation*}\]

  1. Visualisasikan distribusinya dengan scatter plot dan gunakan skala berkelanjutan untuk memisahkan populasi berdasarkan warna.
library(ggplot2)
library(mvtnorm)

Mu1    = c(1,1)
Mu2    = c(7,7)
Sigma1 = matrix(c(2, 1, 1, 1), 2,2)
Sigma2 = matrix(c(2, 2, 2, 5), 2,2)

pi     = 1/3
n      = 300

set.seed(2)
data = matrix(0, n, 2)
z    = rep(0,n)
for (i in 1:n){
  z[i] = rbinom(1,1,pi)
  if (z[i] ==1){
    data[i,] = rmvnorm(1, Mu1,Sigma1)
  }else{
    data[i,] = rmvnorm(1, Mu2,Sigma2)
  }
}

to.plot = data.frame(x = data[,1], 
                     y = data[,2], 
                     class =  z)
ggplot(to.plot)+ aes(x, y, color = class)+
  geom_point()+geom_density_2d()

  1. Ini mengimplementasikan algoritma EM untuk memperkirakan parameternya.

Petunjuk: Susun tebakan awal untuk \(\mu_1\) dan \(\mu_2\) dengan memilih dua \(y_i\) secara acak. Mulai \(\Sigma_1\) dan \(\Sigma_2\) sebagai matriks kovariansi sampel keseluruhan dan \(\pi\) pada nilai \(0,5\). Kriteria berhenti adalah perbedaan antara dua nilai berurutan dari kemungkinan log lengkap kurang dari toleransi yang diinginkan, \(|l_k-l_{k-1}|<\text{tol}\).

# Nilai Awal 
pi     = 0.5
mu1    = data[1,]
mu2    = data[150,]
sigma1 = cov(data)
sigma2 = cov(data)
library(SDMTools)

# Algoritma EM
Alpha = NULL
tol   = 10^-2
iter  = 0
Q     = 0
phi1  = dmvnorm(data, mu1, sigma1)
phi2  = dmvnorm(data, mu2, sigma2)
Q_    = sum(log(pi)+log(phi1)) +
  sum(log(pi)+log(phi2))

while (abs(Q-Q_)>=tol) {
  
  iter = iter+1
  Q    = Q_
  
  # Langkah Ekspektasi 
  alpha = pi*phi1/(pi*phi1+(1-pi)*phi2)
  Alpha = cbind(Alpha, alpha)
  
  # Langkah Maksimalisasi
  mu1    = apply(data, 2, function(col) wt.mean(col, alpha))
  mu2    = apply(data, 2, function(col) wt.mean(col, 1-alpha))
  sigma1 = cov.wt(data, wt = alpha, method = "ML")$cov
  sigma2 = cov.wt(data, wt = 1-alpha, method = "ML")$cov
  pi     = mean(alpha)
   
  phi1   = dmvnorm(data, mu1, sigma1)
  phi2   = dmvnorm(data, mu2, sigma2)
  Q_     = sum(log(pi)+log(phi1)) +
    sum(log(pi)+log(phi2))
}
  1. Memvisualisasikan nilai yang diperoleh untuk probabilitas setiap titik dalam 8 iterasi pertama.
library(reshape)

to.plot = data.frame(x = data[,1],
                     y = data[,2],
                     iter = Alpha[,1:8])
to.plot = melt(to.plot, id.vars = c("x", "y"))

ggplot(to.plot)+aes(x,y, color = value)+
  geom_point()+facet_wrap(~variable, nrow = 2)

1.2 Latihan 2

Mari gunakan algoritma EM untuk melakukan segmentasi gambar. Dalam hal ini kita akan menggunakan gambar melanoma.

library(OpenImageR)
img = readImage("Melanoma.png")
imageShow(img)

Algoritma segmentasi gambar biasa mengubah susunan tiga dimensi yaitu gambar menjadi matriks 3 kolom dengan jumlah baris sebanyak jumlah piksel.

img.vect = apply(img, 3, as.vector)
dim(img.vect)
## [1] 737280      3

Dalam hal ini kita akan mencari proyeksi satu dimensi dari matriks tersebut sehingga algoritma EM dapat digunakan untuk mengestimasi parameter distribusi pada proyeksi yang dihasilkan.

  1. Menerapkan fungsi yang memperkirakan parameter untuk Gaussian Mixture dalam kasus satu dimensi.
EM = function(data){
  
  set.seed(1)
  pi  = 0.5
  mu1 = sample(data,1)
  mu2 = sample(data,1)
  sd1 = sd(data)
  sd2 = sd1
  
  tol  = 10^-2
  iter = 0
  Q    = 0
  phi1 = dnorm(data, mu1, sd1)
  phi2 = dnorm(data, mu2, sd2)
  Q_   = sum(log(pi)+log(phi1)) +
    sum(log(pi)+log(phi2))
  
  while (abs(Q-Q_)>=tol) {
    
    iter = iter+1
    Q    = Q_
    
    # Expectation step 
    alpha = pi*phi1/(pi*phi1+(1-pi)*phi2)
    
    # Maximization step
    mu1 = wt.mean(data, alpha)
    mu2 = wt.mean(data, 1-alpha)
    sd1 = wt.sd(data, wt = alpha)
    sd2 = wt.sd(data, wt = 1-alpha)
    pi  = mean(alpha)
    
    phi1 = dnorm(data, mu1, sd1)
    phi2 = dnorm(data, mu2, sd2)
    Q_   = sum(log(pi)+log(phi1)) +
      sum(log(pi)+log(phi2))
  }
    return(alpha)
 }
  1. Diketahui dalam literatur bahwa pola melanoma biasanya diekspresikan dalam warna biru. Jalankan algoritma EM menggunakan informasi tersebut dan tampilkan hasil akhirnya.
# Susunan Biru + EM
blue = img.vect[,3]
prob = EM(blue)
classification = (prob>0.5)+0
segmented.image = replicate(3,classification, simplify = T)
dim(segmented.image) = dim(img)  
imageShow(segmented.image)

  1. Gunakan proyeksi yang mempertahankan variabilitas data sebanyak mungkin (komponen pertama di PCA) dan terapkan EM. Visualisasikan hasilnya.
# PCA + EM
s.img.vect = scale(img.vect)
sigma = cov(img.vect)
eig = eigen(sigma)
eigenvectors = eig$vectors[,1]
projection = s.img.vect%*% eigenvectors

prob = EM(projection)
classification = (prob>0.5)+0
segmented.image = replicate(3,classification, simplify = T)
dim(segmented.image) = dim(img)  
imageShow(segmented.image)

  1. Gunakan proyeksi Luminance \(L = (0.229,0.588.0.114)\) dan tampilkan hasil penerapan algoritma EM.
# Luminance + EM
luminance = c(0.299, 0.587, 0.114)

projection = img.vect%*%luminance

prob = EM(projection)
classification = (prob>0.5)+0
segmented.image = replicate(3,classification, simplify = T)
dim(segmented.image) = dim(img)  
imageShow(segmented.image)

  1. Terakhir, kami akan menggunakan varian dari algoritma Pengejaran Histogram Independen. Algoritma ini menemukan proyeksi yang memaksimalkan amplitudo bimodal. Setelah proyeksi itu ditemukan, kami melanjutkan ke latihan sebelumnya.
library(modes)
# Pengejaran Histogram Independen
theta = expand.grid(seq(1,360,length.out = 50), 
                    seq(1,360,length.out = 50))

w = matrix(0,nrow(theta),3)
amplitude = rep(0, nrow(theta))
for (i in 1:nrow(theta)){
  w[i,] = c(sin(theta[i,1])*cos(theta[i,2]),
            sin(theta[i,1])*sin(theta[i,2]),
            cos(theta[i,1]))
  amplitude[i] = bimodality_amplitude(img.vect%*%w[i,], fig = F)
}
## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.

## Warning in bimodality_amplitude(img.vect %*% w[i, ], fig = F): Distribution is too bumpy. Consider bootstrapping
##  or alternative method to get more data in the tails.
ind = which.max(amplitude)
w.opt = w[ind,]
projection = img.vect%*%w.opt

prob = EM(projection)
classification = (prob>0.5)+0
segmented.image = replicate(3,classification, simplify = T)
dim(segmented.image) = dim(img)  
imageShow(segmented.image)

LS0tDQp0aXRsZTogIlByYWt0ZWsgMTI6IEVrc3Bla3Rhc2kgTWFrc2ltYWxpc2FzaSINCmF1dGhvcjogIkVsdnJpYW5hIEVsdmFuaSgyMDE4NDkyMDAxMikiDQpkYXRlOiAiYHIgZm9ybWF0KFN5cy5EYXRlKCksICclQiAlZCwgJVknKWAiDQpvdXRwdXQ6IA0KICBodG1sX2RvY3VtZW50OiANCiAgICBoaWdobGlnaHQ6IG1vbm9jaHJvbWUNCiAgICB0aGVtZTogc3BhY2VsYWINCiAgICBudW1iZXJfc2VjdGlvbnM6IHllcw0KICAgIHRvYzogeWVzDQogICAgdG9jX2Zsb2F0OiB5ZXMNCiAgICBjb2RlX2Rvd25sb2FkOiB5ZXMNCiAgICBjb2RlX2ZvbGRpbmc6IGhpZGUNCi0tLQ0KDQpgYGB7ciBMb2dvLCBlY2hvPUZBTFNFLGZpZy5hbGlnbj0nY2VudGVyJywgb3V0LndpZHRoID0gJzQwJSd9DQprbml0cjo6aW5jbHVkZV9ncmFwaGljcygiaHR0cHM6Ly9naXRodWIuY29tL0Jha3RpLVNpcmVnYXIvaW1hZ2VzL2Jsb2IvbWFzdGVyL2xvZ28ucG5nP3Jhdz10cnVlIikNCmBgYA0KDQojIEVrc3Bla3Rhc2kgTWFrc2ltYWxpc2FzaQ0KDQpEaSBrZWxhcyBpbmkga2l0YSBha2FuIG1lbmdpbXBsZW1lbnRhc2lrYW4gYWxnb3JpdG1hIEVrc3Bla3Rhc2kgTWFrc2ltYWxpc2FzaSB1bnR1ayBtZW1wZXJraXJha2FuIHBhcmFtZXRlciBHYXVzc2lhbiBNaXh0dXJlLiBNZXRvZGUgaW5pIG1lbnllZGlha2FuIHBlbmdrbGFzaWZpa2FzaSB0YW5wYSBwZW5nYXdhc2FuIHlhbmcgc2FuZ2F0IGJlcmd1bmEga2V0aWthIGRpYXN1bXNpa2FuIGRpc3RyaWJ1c2kgR2F1c3NpYW4uDQoNCk1pc2Fsa2FuIGtpdGEgaW5naW4gbWVtb2RlbGthbiBwYXJhbWV0ZXIgcG9wdWxhc2kgeWFuZyBkaWFzdW1zaWthbiBtZW5qYWRpIHNhbGFoIHNhdHUgZGFyaSBkdWEgcG9wdWxhc2kgbm9ybWFsIGdhdXNzaWFuIGRlbmdhbiBwcm9iYWJpbGl0YXMgcGVuY2FtcHVyYW4gJFxwaSQuDQoNCkl0dSBiZXJhcnRpICR4X2lcc2ltIE4oXG11XzEsIFxTaWdtYV8xKSQgZGVuZ2FuIHByb2JhYmlsaXRhcyAkXHBpLHhfaVxzaW0gTihcbXVfMiwgXFNpZ21hXzIpJCBkZW5nYW4gcHJvYmFiaWxpdGFzICQoMS1ccGkpJC4gTWFyaSBraXRhIG55YXRha2FuICRcdGhldGFfMT0gKFxtdV8xLCBcU2lnbWFfMSkkIGRhbiAkXHRoZXRhXzIgPSAoXG11XzIsIFxTaWdtYV8yKSQgcGFyYW1ldGVyIGRhcmkgc2V0aWFwIHBvcHVsYXNpIGRhbiAkXHBpJCBwYXJhbWV0ZXIgcGVuY2FtcHVyYW4gZGFuICRccGhpXzEkIGRhbiAkXHBoaV8yJCBrZXBhZGF0YW4gc2V0aWFwIGRpc3RyaWJ1c2kuIEFsZ29yaXRtYSBFa3NwZWt0YXNpIE1ha3NpbWFsaXNhc2kgZGFwYXQgZGlyaW5na2FzIGRhbGFtIGxhbmdrYWgtbGFuZ2thaCBiZXJpa3V0Og0KDQoxLiBBbWJpbCB0ZWJha2FuIGF3YWwgdW50dWsgcGFyYW1ldGVybnlhICRcaGF0e1xtdX1fMSwgXGhhdHtcbXV9XzIsIFxoYXR7XFNpZ21hfV8xLCBcaGF0e1xTaWdtYX1fMiwgXGhhdHtccGl9JA0KDQoyLiBMYW5na2FoIEVrc3Bla3Rhc2k6IEhpdHVuZyAkJFxoYXR7XGdhbW1hfV9pID0gXGRmcmFje1xoYXR7XHBpfVxwaGlfMSh5X2kpfXtcaGF0e1xwaX1ccGhpXzEoeV9pKSsoMS1caGF0e1xwaX0pXHBoaV8yKHlfaSl9JCQNCg0KMy4gTGFuZ2thaCBNYWtzaW1hbGlzYXNpOiBIaXR1bmcgbWVhbiBkYW4gdmFyaWFucyB0ZXJ0aW1iYW5nIA0KJCRcYmVnaW57YWxpZ24qfQ0KIFxoYXR7XG11XzF9ICYgPSBcZGZyYWN7XHN1bV97aT0xfV5uXGhhdHtcZ2FtbWF9X2l4X2l9e1xzdW1fe2k9MX1eblxoYXR7XGdhbW1hfV9pfSAmIFxoYXR7XFNpZ21hXzF9ID0gXGRmcmFjezF9e259XGRmcmFje1xzdW1fe2k9MX1eblxoYXR7XGdhbW1hfV9pKHhfaS1cbXVfMSkoeF9pLVxtdV8xKV5UfXtcc3VtX3tpPTF9Xm5caGF0e1xnYW1tYX1faX1cXA0KIFxoYXR7XG11XzJ9ICYgPSBcZGZyYWN7XHN1bV97aT0xfV5uKDEtXGhhdHtcZ2FtbWF9X2kpeF9pfXtcc3VtX3tpPTF9Xm4oMS1caGF0e1xnYW1tYX1faSl9ICYgIFxoYXR7XFNpZ21hXzJ9ID0gXGRmcmFjezF9e259XGRmcmFje1xzdW1fe2k9MX1eblxoYXR7XGdhbW1hfV9pKHhfaS1cbXVfMikoeF9pLVxtdV8yKV5UfXtcc3VtX3tpPTF9Xm4oMS1caGF0e1xnYW1tYX1faSl9DQpcZW5ke2FsaWduKn0kJA0KZGFuIGtlbXVuZ2tpbmFuIHBlbmNhbXB1cmFuICRcaGF0e1xwaX0gPSBcZGZyYWN7MX17bn1cc3VtX3tpPTF9Xm5caGF0e1xnYW1tYX1faSQNCg0KNC4gVWxhbmdpIGxhbmdrYWggMiBkYW4gMyBoaW5nZ2Ega29udmVyZ2VuLg0KDQojIyBMYXRpaGFuIDENCg0KU2ltdWxhc2lrYW4gMzAwIHNhbXBlbCBHYXVzc2lhbiBNaXh0dXJlIGRlbmdhbiBwcm9iYWJpbGl0YXMgcGVuY2FtcHVyYW4gc2ViZXNhciAkXGZyYWMgezF9ezN9JCBzZWJhZ2FpIGJlcmlrdXQ6DQokJFxiZWdpbntlcXVhdGlvbip9DQpZXzEgXHNpbSBOXGJpZ2coXGJlZ2lue2JtYXRyaXh9MVxcMVxlbmR7Ym1hdHJpeH0sXGJlZ2lue2JtYXRyaXh9MiYxXFwxJjFcZW5ke2JtYXRyaXh9IFxiaWdnKSANClxxcXVhZCBZXzIgXHNpbSBOXGJpZ2coXGJlZ2lue2JtYXRyaXh9N1xcN1xlbmR7Ym1hdHJpeH0sXGJlZ2lue2JtYXRyaXh9MiYyXFwyJjVcZW5ke2JtYXRyaXh9IFxiaWdnKSANClxlbmR7ZXF1YXRpb24qfSQkDQoNCmEuIFZpc3VhbGlzYXNpa2FuIGRpc3RyaWJ1c2lueWEgZGVuZ2FuIHNjYXR0ZXIgcGxvdCBkYW4gZ3VuYWthbiBza2FsYSBiZXJrZWxhbmp1dGFuIHVudHVrIG1lbWlzYWhrYW4gcG9wdWxhc2kgYmVyZGFzYXJrYW4gd2FybmEuDQoNCmBgYHtyfQ0KbGlicmFyeShnZ3Bsb3QyKQ0KbGlicmFyeShtdnRub3JtKQ0KDQpNdTEgICAgPSBjKDEsMSkNCk11MiAgICA9IGMoNyw3KQ0KU2lnbWExID0gbWF0cml4KGMoMiwgMSwgMSwgMSksIDIsMikNClNpZ21hMiA9IG1hdHJpeChjKDIsIDIsIDIsIDUpLCAyLDIpDQoNCnBpICAgICA9IDEvMw0KbiAgICAgID0gMzAwDQoNCnNldC5zZWVkKDIpDQpkYXRhID0gbWF0cml4KDAsIG4sIDIpDQp6ICAgID0gcmVwKDAsbikNCmZvciAoaSBpbiAxOm4pew0KICB6W2ldID0gcmJpbm9tKDEsMSxwaSkNCiAgaWYgKHpbaV0gPT0xKXsNCiAgICBkYXRhW2ksXSA9IHJtdm5vcm0oMSwgTXUxLFNpZ21hMSkNCiAgfWVsc2V7DQogICAgZGF0YVtpLF0gPSBybXZub3JtKDEsIE11MixTaWdtYTIpDQogIH0NCn0NCg0KdG8ucGxvdCA9IGRhdGEuZnJhbWUoeCA9IGRhdGFbLDFdLCANCiAgICAgICAgICAgICAgICAgICAgIHkgPSBkYXRhWywyXSwgDQogICAgICAgICAgICAgICAgICAgICBjbGFzcyA9ICB6KQ0KZ2dwbG90KHRvLnBsb3QpKyBhZXMoeCwgeSwgY29sb3IgPSBjbGFzcykrDQogIGdlb21fcG9pbnQoKStnZW9tX2RlbnNpdHlfMmQoKQ0KYGBgDQoNCmIuIEluaSBtZW5naW1wbGVtZW50YXNpa2FuIGFsZ29yaXRtYSBFTSB1bnR1ayBtZW1wZXJraXJha2FuIHBhcmFtZXRlcm55YS4NCg0KKlBldHVuanVrKjogU3VzdW4gdGViYWthbiBhd2FsIHVudHVrICRcbXVfMSQgZGFuICRcbXVfMiQgZGVuZ2FuIG1lbWlsaWggZHVhICR5X2kkIHNlY2FyYSBhY2FrLiBNdWxhaSAkXFNpZ21hXzEkIGRhbiAkXFNpZ21hXzIkIHNlYmFnYWkgbWF0cmlrcyBrb3ZhcmlhbnNpIHNhbXBlbCBrZXNlbHVydWhhbiBkYW4gJFxwaSQgcGFkYSBuaWxhaSAkMCw1JC4gS3JpdGVyaWEgYmVyaGVudGkgYWRhbGFoIHBlcmJlZGFhbiBhbnRhcmEgZHVhIG5pbGFpIGJlcnVydXRhbiBkYXJpIGtlbXVuZ2tpbmFuIGxvZyBsZW5na2FwIGt1cmFuZyBkYXJpIHRvbGVyYW5zaSB5YW5nIGRpaW5naW5rYW4sICR8bF9rLWxfe2stMX18PFx0ZXh0e3RvbH0kLg0KDQpgYGB7cn0NCiMgTmlsYWkgQXdhbCANCnBpICAgICA9IDAuNQ0KbXUxICAgID0gZGF0YVsxLF0NCm11MiAgICA9IGRhdGFbMTUwLF0NCnNpZ21hMSA9IGNvdihkYXRhKQ0Kc2lnbWEyID0gY292KGRhdGEpDQpgYGANCg0KYGBge3J9DQpsaWJyYXJ5KFNETVRvb2xzKQ0KDQojIEFsZ29yaXRtYSBFTQ0KQWxwaGEgPSBOVUxMDQp0b2wgICA9IDEwXi0yDQppdGVyICA9IDANClEgICAgID0gMA0KcGhpMSAgPSBkbXZub3JtKGRhdGEsIG11MSwgc2lnbWExKQ0KcGhpMiAgPSBkbXZub3JtKGRhdGEsIG11Miwgc2lnbWEyKQ0KUV8gICAgPSBzdW0obG9nKHBpKStsb2cocGhpMSkpICsNCiAgc3VtKGxvZyhwaSkrbG9nKHBoaTIpKQ0KDQp3aGlsZSAoYWJzKFEtUV8pPj10b2wpIHsNCiAgDQogIGl0ZXIgPSBpdGVyKzENCiAgUSAgICA9IFFfDQogIA0KICAjIExhbmdrYWggRWtzcGVrdGFzaSANCiAgYWxwaGEgPSBwaSpwaGkxLyhwaSpwaGkxKygxLXBpKSpwaGkyKQ0KICBBbHBoYSA9IGNiaW5kKEFscGhhLCBhbHBoYSkNCiAgDQogICMgTGFuZ2thaCBNYWtzaW1hbGlzYXNpDQogIG11MSAgICA9IGFwcGx5KGRhdGEsIDIsIGZ1bmN0aW9uKGNvbCkgd3QubWVhbihjb2wsIGFscGhhKSkNCiAgbXUyICAgID0gYXBwbHkoZGF0YSwgMiwgZnVuY3Rpb24oY29sKSB3dC5tZWFuKGNvbCwgMS1hbHBoYSkpDQogIHNpZ21hMSA9IGNvdi53dChkYXRhLCB3dCA9IGFscGhhLCBtZXRob2QgPSAiTUwiKSRjb3YNCiAgc2lnbWEyID0gY292Lnd0KGRhdGEsIHd0ID0gMS1hbHBoYSwgbWV0aG9kID0gIk1MIikkY292DQogIHBpICAgICA9IG1lYW4oYWxwaGEpDQogICANCiAgcGhpMSAgID0gZG12bm9ybShkYXRhLCBtdTEsIHNpZ21hMSkNCiAgcGhpMiAgID0gZG12bm9ybShkYXRhLCBtdTIsIHNpZ21hMikNCiAgUV8gICAgID0gc3VtKGxvZyhwaSkrbG9nKHBoaTEpKSArDQogICAgc3VtKGxvZyhwaSkrbG9nKHBoaTIpKQ0KfQ0KYGBgDQoNCmMuIE1lbXZpc3VhbGlzYXNpa2FuIG5pbGFpIHlhbmcgZGlwZXJvbGVoIHVudHVrIHByb2JhYmlsaXRhcyBzZXRpYXAgdGl0aWsgZGFsYW0gOCBpdGVyYXNpIHBlcnRhbWEuDQoNCmBgYHtyfQ0KbGlicmFyeShyZXNoYXBlKQ0KDQp0by5wbG90ID0gZGF0YS5mcmFtZSh4ID0gZGF0YVssMV0sDQogICAgICAgICAgICAgICAgICAgICB5ID0gZGF0YVssMl0sDQogICAgICAgICAgICAgICAgICAgICBpdGVyID0gQWxwaGFbLDE6OF0pDQp0by5wbG90ID0gbWVsdCh0by5wbG90LCBpZC52YXJzID0gYygieCIsICJ5IikpDQoNCmdncGxvdCh0by5wbG90KSthZXMoeCx5LCBjb2xvciA9IHZhbHVlKSsNCiAgZ2VvbV9wb2ludCgpK2ZhY2V0X3dyYXAofnZhcmlhYmxlLCBucm93ID0gMikNCmBgYA0KDQojIyBMYXRpaGFuIDINCg0KTWFyaSBndW5ha2FuIGFsZ29yaXRtYSBFTSB1bnR1ayBtZWxha3VrYW4gc2VnbWVudGFzaSBnYW1iYXIuIERhbGFtIGhhbCBpbmkga2l0YSBha2FuIG1lbmdndW5ha2FuIGdhbWJhciAqbWVsYW5vbWEqLg0KDQpgYGB7cn0NCmxpYnJhcnkoT3BlbkltYWdlUikNCmltZyA9IHJlYWRJbWFnZSgiTWVsYW5vbWEucG5nIikNCmltYWdlU2hvdyhpbWcpDQpgYGANCg0KQWxnb3JpdG1hIHNlZ21lbnRhc2kgZ2FtYmFyIGJpYXNhIG1lbmd1YmFoIHN1c3VuYW4gdGlnYSBkaW1lbnNpIHlhaXR1IGdhbWJhciBtZW5qYWRpIG1hdHJpa3MgMyBrb2xvbSBkZW5nYW4ganVtbGFoIGJhcmlzIHNlYmFueWFrIGp1bWxhaCBwaWtzZWwuDQoNCmBgYHtyfQ0KaW1nLnZlY3QgPSBhcHBseShpbWcsIDMsIGFzLnZlY3RvcikNCmRpbShpbWcudmVjdCkNCmBgYA0KDQpEYWxhbSBoYWwgaW5pIGtpdGEgYWthbiBtZW5jYXJpIHByb3lla3NpIHNhdHUgZGltZW5zaSBkYXJpIG1hdHJpa3MgdGVyc2VidXQgc2VoaW5nZ2EgYWxnb3JpdG1hIEVNIGRhcGF0IGRpZ3VuYWthbiB1bnR1ayBtZW5nZXN0aW1hc2kgcGFyYW1ldGVyIGRpc3RyaWJ1c2kgcGFkYSBwcm95ZWtzaSB5YW5nIGRpaGFzaWxrYW4uDQoNCmEuIE1lbmVyYXBrYW4gZnVuZ3NpIHlhbmcgbWVtcGVya2lyYWthbiBwYXJhbWV0ZXIgdW50dWsgR2F1c3NpYW4gTWl4dHVyZSBkYWxhbSBrYXN1cyBzYXR1IGRpbWVuc2kuDQoNCmBgYHtyfQ0KRU0gPSBmdW5jdGlvbihkYXRhKXsNCiAgDQogIHNldC5zZWVkKDEpDQogIHBpICA9IDAuNQ0KICBtdTEgPSBzYW1wbGUoZGF0YSwxKQ0KICBtdTIgPSBzYW1wbGUoZGF0YSwxKQ0KICBzZDEgPSBzZChkYXRhKQ0KICBzZDIgPSBzZDENCiAgDQogIHRvbCAgPSAxMF4tMg0KICBpdGVyID0gMA0KICBRICAgID0gMA0KICBwaGkxID0gZG5vcm0oZGF0YSwgbXUxLCBzZDEpDQogIHBoaTIgPSBkbm9ybShkYXRhLCBtdTIsIHNkMikNCiAgUV8gICA9IHN1bShsb2cocGkpK2xvZyhwaGkxKSkgKw0KICAgIHN1bShsb2cocGkpK2xvZyhwaGkyKSkNCiAgDQogIHdoaWxlIChhYnMoUS1RXyk+PXRvbCkgew0KICAgIA0KICAgIGl0ZXIgPSBpdGVyKzENCiAgICBRICAgID0gUV8NCiAgICANCiAgICAjIEV4cGVjdGF0aW9uIHN0ZXAgDQogICAgYWxwaGEgPSBwaSpwaGkxLyhwaSpwaGkxKygxLXBpKSpwaGkyKQ0KICAgIA0KICAgICMgTWF4aW1pemF0aW9uIHN0ZXANCiAgICBtdTEgPSB3dC5tZWFuKGRhdGEsIGFscGhhKQ0KICAgIG11MiA9IHd0Lm1lYW4oZGF0YSwgMS1hbHBoYSkNCiAgICBzZDEgPSB3dC5zZChkYXRhLCB3dCA9IGFscGhhKQ0KICAgIHNkMiA9IHd0LnNkKGRhdGEsIHd0ID0gMS1hbHBoYSkNCiAgICBwaSAgPSBtZWFuKGFscGhhKQ0KICAgIA0KICAgIHBoaTEgPSBkbm9ybShkYXRhLCBtdTEsIHNkMSkNCiAgICBwaGkyID0gZG5vcm0oZGF0YSwgbXUyLCBzZDIpDQogICAgUV8gICA9IHN1bShsb2cocGkpK2xvZyhwaGkxKSkgKw0KICAgICAgc3VtKGxvZyhwaSkrbG9nKHBoaTIpKQ0KICB9DQogICAgcmV0dXJuKGFscGhhKQ0KIH0NCmBgYA0KDQoNCmIuIERpa2V0YWh1aSBkYWxhbSBsaXRlcmF0dXIgYmFod2EgcG9sYSBtZWxhbm9tYSBiaWFzYW55YSBkaWVrc3ByZXNpa2FuIGRhbGFtIHdhcm5hIGJpcnUuIEphbGFua2FuIGFsZ29yaXRtYSBFTSBtZW5nZ3VuYWthbiBpbmZvcm1hc2kgdGVyc2VidXQgZGFuIHRhbXBpbGthbiBoYXNpbCBha2hpcm55YS4NCg0KYGBge3J9DQojIFN1c3VuYW4gQmlydSArIEVNDQpibHVlID0gaW1nLnZlY3RbLDNdDQpwcm9iID0gRU0oYmx1ZSkNCmNsYXNzaWZpY2F0aW9uID0gKHByb2I+MC41KSswDQpzZWdtZW50ZWQuaW1hZ2UgPSByZXBsaWNhdGUoMyxjbGFzc2lmaWNhdGlvbiwgc2ltcGxpZnkgPSBUKQ0KZGltKHNlZ21lbnRlZC5pbWFnZSkgPSBkaW0oaW1nKSAgDQppbWFnZVNob3coc2VnbWVudGVkLmltYWdlKQ0KYGBgDQoNCmMuIEd1bmFrYW4gcHJveWVrc2kgeWFuZyBtZW1wZXJ0YWhhbmthbiB2YXJpYWJpbGl0YXMgZGF0YSBzZWJhbnlhayBtdW5na2luIChrb21wb25lbiBwZXJ0YW1hIGRpIFBDQSkgZGFuIHRlcmFwa2FuIEVNLiBWaXN1YWxpc2FzaWthbiBoYXNpbG55YS4NCg0KYGBge3J9DQojIFBDQSArIEVNDQpzLmltZy52ZWN0ID0gc2NhbGUoaW1nLnZlY3QpDQpzaWdtYSA9IGNvdihpbWcudmVjdCkNCmVpZyA9IGVpZ2VuKHNpZ21hKQ0KZWlnZW52ZWN0b3JzID0gZWlnJHZlY3RvcnNbLDFdDQpwcm9qZWN0aW9uID0gcy5pbWcudmVjdCUqJSBlaWdlbnZlY3RvcnMNCg0KcHJvYiA9IEVNKHByb2plY3Rpb24pDQpjbGFzc2lmaWNhdGlvbiA9IChwcm9iPjAuNSkrMA0Kc2VnbWVudGVkLmltYWdlID0gcmVwbGljYXRlKDMsY2xhc3NpZmljYXRpb24sIHNpbXBsaWZ5ID0gVCkNCmRpbShzZWdtZW50ZWQuaW1hZ2UpID0gZGltKGltZykgIA0KaW1hZ2VTaG93KHNlZ21lbnRlZC5pbWFnZSkNCmBgYA0KDQpkLiBHdW5ha2FuIHByb3lla3NpIEx1bWluYW5jZSAkTCA9ICgwLjIyOSwwLjU4OC4wLjExNCkkIGRhbiB0YW1waWxrYW4gaGFzaWwgcGVuZXJhcGFuIGFsZ29yaXRtYSBFTS4NCg0KYGBge3J9DQojIEx1bWluYW5jZSArIEVNDQpsdW1pbmFuY2UgPSBjKDAuMjk5LCAwLjU4NywgMC4xMTQpDQoNCnByb2plY3Rpb24gPSBpbWcudmVjdCUqJWx1bWluYW5jZQ0KDQpwcm9iID0gRU0ocHJvamVjdGlvbikNCmNsYXNzaWZpY2F0aW9uID0gKHByb2I+MC41KSswDQpzZWdtZW50ZWQuaW1hZ2UgPSByZXBsaWNhdGUoMyxjbGFzc2lmaWNhdGlvbiwgc2ltcGxpZnkgPSBUKQ0KZGltKHNlZ21lbnRlZC5pbWFnZSkgPSBkaW0oaW1nKSAgDQppbWFnZVNob3coc2VnbWVudGVkLmltYWdlKQ0KYGBgDQoNCmUuIFRlcmFraGlyLCBrYW1pIGFrYW4gbWVuZ2d1bmFrYW4gdmFyaWFuIGRhcmkgYWxnb3JpdG1hIFBlbmdlamFyYW4gSGlzdG9ncmFtIEluZGVwZW5kZW4uIEFsZ29yaXRtYSBpbmkgbWVuZW11a2FuIHByb3lla3NpIHlhbmcgbWVtYWtzaW1hbGthbiBhbXBsaXR1ZG8gYmltb2RhbC4gU2V0ZWxhaCBwcm95ZWtzaSBpdHUgZGl0ZW11a2FuLCBrYW1pIG1lbGFuanV0a2FuIGtlIGxhdGloYW4gc2ViZWx1bW55YS4NCg0KYGBge3J9DQpsaWJyYXJ5KG1vZGVzKQ0KIyBQZW5nZWphcmFuIEhpc3RvZ3JhbSBJbmRlcGVuZGVuDQp0aGV0YSA9IGV4cGFuZC5ncmlkKHNlcSgxLDM2MCxsZW5ndGgub3V0ID0gNTApLCANCiAgICAgICAgICAgICAgICAgICAgc2VxKDEsMzYwLGxlbmd0aC5vdXQgPSA1MCkpDQoNCncgPSBtYXRyaXgoMCxucm93KHRoZXRhKSwzKQ0KYW1wbGl0dWRlID0gcmVwKDAsIG5yb3codGhldGEpKQ0KZm9yIChpIGluIDE6bnJvdyh0aGV0YSkpew0KICB3W2ksXSA9IGMoc2luKHRoZXRhW2ksMV0pKmNvcyh0aGV0YVtpLDJdKSwNCiAgICAgICAgICAgIHNpbih0aGV0YVtpLDFdKSpzaW4odGhldGFbaSwyXSksDQogICAgICAgICAgICBjb3ModGhldGFbaSwxXSkpDQogIGFtcGxpdHVkZVtpXSA9IGJpbW9kYWxpdHlfYW1wbGl0dWRlKGltZy52ZWN0JSold1tpLF0sIGZpZyA9IEYpDQp9DQoNCmluZCA9IHdoaWNoLm1heChhbXBsaXR1ZGUpDQp3Lm9wdCA9IHdbaW5kLF0NCnByb2plY3Rpb24gPSBpbWcudmVjdCUqJXcub3B0DQoNCnByb2IgPSBFTShwcm9qZWN0aW9uKQ0KY2xhc3NpZmljYXRpb24gPSAocHJvYj4wLjUpKzANCnNlZ21lbnRlZC5pbWFnZSA9IHJlcGxpY2F0ZSgzLGNsYXNzaWZpY2F0aW9uLCBzaW1wbGlmeSA9IFQpDQpkaW0oc2VnbWVudGVkLmltYWdlKSA9IGRpbShpbWcpICANCmltYWdlU2hvdyhzZWdtZW50ZWQuaW1hZ2UpDQpgYGANCg0KDQoNCg0KDQoNCg0KDQo=