Latihan 12: Ekspektasi Maksimum

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

Misalkan kita ingin memodelkan parameter populasi yang diasumsikan menjadi salah satu dari dua populasi normal gaussian dengan probabilitas pencampuran \(π\). Itu berarti \(xi∼N (μ_1, Σ_1)\) dengan probabilitas \(π\), \(xi∼N (μ_2, Σ_2)\) dengan probabilitas \((1 − π)\). Mari kita nyatakan \(θ_1 = (μ_1, Σ_1)\) dan \(θ_2 = (μ_2, Σ_2)\) menjadi parameter dari setiap populasi dan \(π\) menjadi parameter campurandan \(ϕ1\) dan \(ϕ2\) merupakan kepadatan setiap distribusi. Algoritma expektasi maksimalisasi dapat diringkas dalam langkah-langkah berikut:

  1. Ambil tebakan awal untuk parameter \(\hat{μ_1}\), \(\hat{μ_2}\), \(\hat{Σ_1}\), \(\hat{Σ_2}\), \(\hat{π}\).

  2. Langkah Ekspektasi: Perhitungan \[\hat{γ_i} = \frac {\hat{π}ϕ_1 (y_i)} {\hat{π}ϕ_1 (y_i)+ (1 −\hat{π}) ϕ_2 (y_i)} \]

  3. Langkah Maksimalisasi: Hitung mean dan varians \[\hat{μ_1} = \frac {∑_{i=1}^n \hat{γ_i} x_i}{∑_{i=1}^n \hat{γ_i}}\]

\[\hat∑_{1} = \frac {1} {n} \frac {{∑_{i=1}^n \hat{γ_i}} ( x_i-μ_1) (x_i-μ_1)^T} {∑_{i=1}^n \hat{γ_i}} \]

\[\hat{μ_2} = \frac {∑_{i=1}^n (1-\hat{γ_i}) x_i}{∑_{i=1}^n (1-\hat{γ_i})}\]

\[\hat∑_{2} = \frac {1} {n} \frac {{∑_{i=1}^n \hat{γ_i}} ( x_i-μ_2) (x_i-μ_2)^T} {∑_{i=1}^n (1- \hat{γ_i})} \] dan probabilitas campurannya \(\hat{π} = \frac {1} {n} ∑_{i=1}^n \hat{γ_i}\).

4.Ulangi langkah 2 dan 3 hingga konvergen.

Latihan 1:

Simulasikan 300 sampel Gaussian Mixture dengan probabilitas pencampurannya 1/3:

\[Y_1 ∼ N \begin{pmatrix} \begin{bmatrix} 1 \\ 1 \end{bmatrix}, \begin{bmatrix} 2 &1 \\ 1&1 \end{bmatrix} \end{pmatrix}\]

\[Y_2 ∼ N \begin{pmatrix} \begin{bmatrix} 7 \\ 7 \end{bmatrix}, \begin{bmatrix} 2 &2 \\ 2&5 \end{bmatrix} \end{pmatrix}\]

  1. Visualisasikan distribusinya dengan scatter plot dan gunakan skala berkelanjutan (continuous scale) untuk memisahkan populasi berdasarkan warna.
library(ggplot2)
## Warning: package 'ggplot2' was built under R version 3.6.3
library(mvtnorm)
## Warning: package 'mvtnorm' was built under R version 3.6.3
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 \(μ_1\) dan \(μ_2\) dengan memilih dua \(y_i\) secara acak. Mulailah dengan \(Σ_1\) dan \(Σ_2\) sebagai matriks kovariansi sampel keseluruhan dan \(π\) pada nilai 0,5. Kriteria yang berhenti menunjukka bahwa adanya perbedaan antara dua nilai berurutan dari kemungkinan log lengkap kurang dari toleransi yang diinginkan, \(| l_k − l_{k − 1} | <tol\).

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

# 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. Visualisasikan nilai yang diperoleh untuk probabilitas setiap titik dalam 8 iterasi pertama.
library(reshape)
## Warning: package 'reshape' was built under R version 3.6.3
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)

Latihan 2

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

library(OpenImageR)
## Warning: package 'OpenImageR' was built under R version 3.6.3
img = readImage("Melanoma.png")
imageShow(img)

Algoritma segmentasi gambar 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 campuran Gaussian 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_
    
    # Langkah Ekspektasi
    alpha = pi*phi1/(pi*phi1+(1-pi)*phi2)
    
    # Langkah Maksimalisasi
    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)
 }

Diketahui dalam literatur bahwa pola melanoma biasanya diekspresikan dalam warna biru. Jalankan algoritma EM menggunakan informasi tersebut dan tampilkan hasil akhirnya.

# Susunan warna 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)

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)

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)

e.Terakhir, kami akan menggunakan varian dari algoritme 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)