flowchart A[Xeno Canto\nrecordings] --> B(Manual annotations\nin Raven) B --> C(Visually\ndouble-check) C --> D(Measure spectral\nfeatures in R) D --> E(Center\n& scale) E --> F(UMAP/TSNE\nDimension reduction) F --> G(complexity:Acoustic\nspace \nkernel density) G --> H[Output Acoustic\nstructure data set] D --> H style A fill:#44015466 style B fill:#3E4A894D style C fill:#26828E4D style D fill:#6DCD594D style E fill:#6DCD594D style F fill:#6DCD594D style H fill:#FDE7254D style G fill:#31688E4D
Acoustic analysis
Owl vocalization comparative analysis
Source code, data and annotation protocol found at https://github.com/maRce10/owl_vocalization_comparative_analysis
Purposes
Pool together acoustic data
Double-check acoustic data
Measure acoustic structure
1 Data analysis workflow
2 Acoustic data overview
Code
::feature_acoustic_data("./data/raw/recordings") ohun
Features of the acoustic data set in '/home/m/Dropbox/Projects/owl_vocalization_comparative_analysis/data/raw/recordings':
* 485 sound files
* 1 file format(s) (.wav (485))
* 1 sampling rate(s) (44.1 kHz (485))
* 1 bit depth(s) (16 bits (485))
* 1 number of channels (1 channel(s) (485))
* File duration range: 5.06-445.03 s (mean: 60.09 s)
* File size range: 0.45-39.25 MB (mean: 5.3 MB)
(detailed information by sound file can be obtained with 'warbleR::info_sound_files()')
3 Cheking annotations
Code
<- imp_raven(path = "./data/processed", files = "consolidated_annotations_neurocin.txt",
rav_dat warbler.format = TRUE, all.data = TRUE)
<- check_sels(rav_dat, path = "./data/raw/recordings") cs
all selections are OK
Code
$species_subsp <- gsub(".wav", "", sapply(strsplit(rav_dat$sound.files,
rav_datsplit = " - "), "[", 3))
# rav_dat[is.na(rav_dat$species_subsp), ]
$species_subsp[is.na(rav_dat$species_subsp)] <- "Tyto rosenbergii"
rav_dat
$species <- sapply(strsplit(rav_dat$species, split = " "),
rav_datfunction(x) paste(x[1:2], collapse = " "))
$selec.file <- NULL
rav_dat
$duration <- rav_dat$end - rav_dat$start
rav_dat
<- rav_dat[!(rav_dat$sound.files == "XC500332 - Autillo guatemalteco - Megascops guatemalae hastatus.wav" &
rav_dat $duration < 2), ]
rav_dat
<- rav_dat[rav_dat$sound.files != "XC607196 - Mochuelo peruano - Glaucidium peruanum.wav",
rav_dat
]
<- rav_dat[rav_dat$sound.files != "XC610028 - Mochuelo caburé - Glaucidium brasilianum.wav",
rav_dat
]
<- summarize_reference(reference = rav_dat, units = c("s",
summ_anns "kHz"), by.sound.file = TRUE)
<- summarize_reference(reference = rav_dat, units = c("s", "kHz"),
sr by.sound.file = FALSE)
.print_df(sr, height = NULL, row.names = TRUE)
min | mean | max | |
---|---|---|---|
sel.duration | 0.01 | 0.18 | 2.95 |
gap.duration | 0.00 | 1.46 | 229.01 |
annotations | 1.00 | 21.16 | 213.00 |
bottom.freq | 0.00 | 0.63 | 19.27 |
top.freq | 0.19 | 2.70 | 22.05 |
430 annotated sound files
200 annotated species
4 Print spectrograms:
Code
full_spectrograms(X = rav_dat, sxrow = 3, rows = 8, path = "./data/raw/recordings",
dest.path = "./data/processed/annotated_spectrograms", horizontal = TRUE,
fast.spec = TRUE, parallel = 14, flim = c("-1", "+1"), overwrite = TRUE,
only.annotated = TRUE, ovlp = 50, collevels = seq(-100, 0, 5),
song = "song", labels = "element")
4.1 Measuring structure
Code
<- spectro_analysis(X = rav_dat, path = "./data/raw/recordings",
sp parallel = 15, harmonicity = TRUE)
$species <- rav_dat$species
sp$species_subsp <- rav_dat$species_subsp
sp$song <- rav_dat$song
sp$element <- rav_dat$element
sp$sf.song <- paste(sp$sound.files, sp$song, sep = "-")
sp
write.csv(sp, "./data/processed/spectral_features.csv", row.names = FALSE)
5 Quantify acoustic spaces with UMAP and TSNE
Code
<- read.csv("./data/processed/spectral_features.csv")
sp
# remove NAs
<- sp[!is.na(sp$skew), ]
sp sapply(sp, function(x) sum(is.na(x)))
<- sp[, !sapply(sp, anyNA)]
sp
<- c("duration", "meanfreq", "sd", "freq.median", "freq.Q25",
acous_features "freq.Q75", "freq.IQR", "time.median", "time.Q25", "time.Q75",
"time.IQR", "skew", "kurt", "sp.ent", "time.ent", "entropy", "sfm",
"meandom", "mindom", "maxdom", "dfrange", "modindx", "startdom",
"enddom", "dfslope", "meanpeakf")
<- scale(sp[, acous_features])
scale_sp
<- umap(scale_sp, n_neighbors = 15, n_components = 2)
umap_result
# add results to sp
$UMAP1 <- umap_result$layout[, 1]
sp$UMAP2 <- umap_result$layout[, 2]
sp
<- Rtsne(scale_sp, dims = 2, perplexity = 30, verbose = FALSE,
tsne max_iter = 5000)
$TSNE1 <- tsne$Y[, 1]
sp$TSNE2 <- tsne$Y[, 2]
sp
write.csv(sp, "./data/processed/umap_tsne_on_spectral_features.csv",
row.names = FALSE)
5.1 UMAP space
Code
<- read.csv("./data/processed/umap_tsne_on_spectral_features.csv")
sp
# Create a scatterplot
<- ggplot(sp, aes(x = UMAP1, y = UMAP2, color = species, fill = species)) +
gg_umap geom_point(size = 4) + # ylim(c(-7, 7)) + geom_point(size =
geom_point(size = 4) + # ylim(c(-7, 7)) + 4) + # ylim(c(-7,
geom_point(size = 4) + # ylim(c(-7, 7)) + 7)) +
scale_color_viridis_d(alpha = 0.3, begin = 0.1, end = 0.8) + scale_fill_viridis_d(alpha = 0.2,
begin = 0.1, end = 0.8) + theme_classic(base_size = 20) + labs(x = "UMAP1",
y = "UMAP2", color = "Locality", fill = "Locality") + theme(legend.position = "none")
gg_umap
5.2 TSNE space
Code
<- read.csv("./data/processed/umap_tsne_on_spectral_features.csv")
sp
# Create a scatterplot
<- ggplot(sp, aes(x = TSNE1, y = TSNE2, color = species, fill = species)) +
gg_tsne geom_point(size = 4) + # ylim(c(-7, 7)) + geom_point(size =
geom_point(size = 4) + # ylim(c(-7, 7)) + 4) + # ylim(c(-7,
geom_point(size = 4) + # ylim(c(-7, 7)) + 7)) +
scale_color_viridis_d(alpha = 0.3, begin = 0.1, end = 0.8) + scale_fill_viridis_d(alpha = 0.2,
begin = 0.1, end = 0.8) + theme_classic(base_size = 20) + labs(x = "TSNE1",
y = "TSNE2", color = "Locality", fill = "Locality") + theme(legend.position = "none")
gg_tsne
5.3 Measure acoustic space per sound file on UMAP dimensions
Code
<- rarefact_space_size(formula = sound.files ~ UMAP1 +
raref_spaces_mst data = sp, replace = TRUE, n = median(summ_anns$annotations),
UMAP2, seed = 123, parallel = 10, iterations = 100, type = "mst")
<- space_size(formula = sound.files ~ UMAP1 + UMAP2, data = sp,
spaces_mst parallel = 10, type = "mst")
<- rarefact_space_size(formula = sound.files ~
raref_spaces_density + UMAP2, data = sp, replace = TRUE, n = median(summ_anns$annotations),
UMAP1 seed = 123, parallel = 10, iterations = 100, type = "density")
<- space_size(formula = sound.files ~ UMAP1 + UMAP2,
spaces_density data = sp, parallel = 10, type = "density")
<- rarefact_space_size(formula = sound.files ~ UMAP1 +
raref_spaces_mcp data = sp, replace = TRUE, n = median(summ_anns$annotations),
UMAP2, seed = 123, parallel = 10, iterations = 100, type = "mcp")
<- space_size(formula = sound.files ~ UMAP1 + UMAP2, data = sp,
spaces_mcp parallel = 10, type = "mcp")
<- raref_spaces_mst[, c("group"), drop = FALSE]
spaces
$raref.mst.size <- raref_spaces_mst$mean.size
spaces
$raref.density.size <- raref_spaces_kernel$mean.size
spaces
$raref.mcp.size <- raref_spaces_mcp$mean.size
spaces
$mst.size <- spaces_mst$size
spaces$mst.size[is.na(spaces$mst.size)] <- 0
spaces
$density.size <- spaces_density$size
spaces
$mcp.size <- spaces_mcp$size
spaces
write.csv(spaces, "./data/processed/umap_acoustic_spaces.csv", row.names = FALSE)
<- data.frame(group = spaces$group, complete(mice(data = spaces[,
imputed_spaces -1])))
write.csv(imputed_spaces, "./data/processed/umap_imputed_acoustic_spaces.csv",
row.names = FALSE)
5.4 Measure acoustic space per sound file on TSNE dimensions
Code
<- rarefact_space_size(formula = sound.files ~ TSNE1 +
raref_spaces_mst data = sp, replace = TRUE, n = median(summ_anns$annotations),
TSNE2, seed = 123, parallel = 10, iterations = 100, type = "mst")
<- space_size(formula = sound.files ~ TSNE1 + TSNE2, data = sp,
spaces_mst parallel = 10, type = "mst")
<- rarefact_space_size(formula = sound.files ~
raref_spaces_density + TSNE2, data = sp, replace = TRUE, n = median(summ_anns$annotations),
TSNE1 seed = 123, parallel = 10, iterations = 100, type = "density")
<- space_size(formula = sound.files ~ TSNE1 + TSNE2,
spaces_density data = sp, parallel = 10, type = "density")
<- rarefact_space_size(formula = sound.files ~ TSNE1 +
raref_spaces_mcp data = sp, replace = TRUE, n = median(summ_anns$annotations),
TSNE2, seed = 123, parallel = 10, iterations = 100, type = "mcp")
<- space_size(formula = sound.files ~ TSNE1 + TSNE2, data = sp,
spaces_mcp parallel = 10, type = "mcp")
<- raref_spaces_mst[, c("group"), drop = FALSE]
spaces
$raref.mst.size <- raref_spaces_mst$mean.size
spaces
$raref.density.size <- raref_spaces_density$mean.size
spaces
$raref.mcp.size <- raref_spaces_mcp$mean.size
spaces
$mst.size <- spaces_mst$size
spaces$mst.size[is.na(spaces$mst.size)] <- 0
spaces
$density.size <- spaces_density$size
spaces
$mcp.size <- spaces_mcp$size
spaces
write.csv(spaces, "./data/processed/tsne_acoustic_spaces.csv", row.names = FALSE)
<- data.frame(group = spaces$group, complete(mice(data = spaces[,
imputed_spaces -1])))
write.csv(imputed_spaces, "./data/processed/tsne_imputed_acoustic_spaces.csv",
row.names = FALSE)
6 Add song complexity measures
Code
<- song_analysis(X = rav_dat, song_colm = "song", elm_colm = "element")
song_complx
$species <- sapply(song_complx$sound.files, function(x) sp$species[sp$sound.files ==
song_complx1])
x][
$species <- sapply(song_complx$sound.files, function(x) sp$species[sp$sound.files ==
song_complx1])
x][
<- aggregate(cbind(song.duration, num.elms,
agg_song_by_sound_file ~ sound.files, song_complx, FUN = mean)
elm.types)
write.csv(agg_song_by_sound_file, "./data/processed/song_complexity_features_by_sound_file.csv",
row.names = FALSE)
<- aggregate(cbind(song.duration, num.elms, elm.types) ~
agg_song_by_species FUN = mean)
species, song_complx,
write.csv(agg_song_by_species, "./data/processed/song_complexity_features_by_species.csv",
row.names = FALSE)
7 Pairwise correlation between space size measures
7.1 UMAP
Code
<- read.csv("./data/processed/umap_imputed_acoustic_spaces.csv")
umap_space
<- cor(umap_space[, -1], use = "pairwise.complete.obs")
umap_cormat
<- colorRampPalette(c(viridis(3, direction = 1, begin = 0.2,
cols_corr end = 0.5), "#BEBEBE1A", "white", "#BEBEBE1A", viridis(3, direction = 1,
begin = 0.7, end = 0.9)))(30)
corrplot.mixed(umap_cormat, tl.cex = 0.7, upper.col = cols_corr, lower.col = cols_corr,
lower = "number", upper = "ellipse", tl.col = "black")
7.2 TSNE
Code
<- read.csv("./data/processed/tsne_imputed_acoustic_spaces.csv")
tsne_space
<- cor(tsne_space[, -1], use = "pairwise.complete.obs")
tsne_cormat
corrplot.mixed(tsne_cormat, tl.cex = 0.7, upper.col = cols_corr, lower.col = cols_corr,
lower = "number", upper = "ellipse", tl.col = "black")
7.3 TSNE and UMAP
Code
<- cbind(tsne_space[, -1], umap_space[umap_space$group %in%
spaces $group, -1])
tsne_space
names(spaces) <- paste(rep(c("tsne", "umap")), names(spaces), sep = "-")
<- cor(spaces, use = "pairwise.complete.obs")
cormat
corrplot.mixed(cormat, tl.cex = 0.7, upper.col = cols_corr, lower.col = cols_corr,
lower = "number", upper = "ellipse", tl.col = "black")
8 Generate single data set
Each row is a sound file
Code
<- read.csv("./data/processed/tsne_imputed_acoustic_spaces.csv")
tsne_space <- read.csv("./data/processed/umap_imputed_acoustic_spaces.csv")
umap_space
<- umap_space[umap_space$group %in% tsne_space$group, ]
umap_space
<- data.frame(sound.files = tsne_space$group)
output_data
$species <- sapply(output_data$sound.files, function(x) rav_dat$species[rav_dat$sound.files ==
output_data1])
x][
$umap.space.size <- umap_space$raref.density.size * 100/max(umap_space$raref.density.size)
output_data
$tsne.space.size <- tsne_space$raref.density.size * 100/max(tsne_space$raref.density.size)
output_data
$log.umap.space.size <- log(output_data$umap.space.size)
output_data$log.tsne.space.size <- log(output_data$tsne.space.size +
output_data1)
$peak.frequency <- sapply(output_data$sound.files, function(x) {
output_dataweighted.mean(sp$meanpeakf[sp$sound.files == x], w = sp$duration[sp$sound.files ==
x])
})
$frequency.range <- sapply(output_data$sound.files, function(x) {
output_datamax(sp$freq.Q75[sp$sound.files == x]) - min(sp$freq.Q25[sp$sound.files ==
x])
})
$modulation <- sapply(output_data$sound.files, function(x) {
output_dataweighted.mean(sp$modindx[sp$sound.files == x], w = sp$duration[sp$sound.files ==
x])
})
$elm.duration <- sapply(output_data$sound.files, function(x) {
output_datamean(sp$duration[sp$sound.files == x])
})
<- read.csv("./data/processed/song_complexity_features_by_sound_file.csv")
agg_song_sf
$song.duration <- sapply(output_data$sound.files, function(x) {
output_data<- agg_song_sf$song.duration[agg_song_sf$sound.files == x]
x
if (length(x) == 0)
<- NA
x return(x)
})
$num.elms <- sapply(output_data$sound.files, function(x) {
output_data<- agg_song_sf$num.elms[agg_song_sf$sound.files == x]
x
if (length(x) == 0)
<- NA
x return(x)
})
$elm.types <- sapply(output_data$sound.files, function(x) {
output_data<- agg_song_sf$elm.types[agg_song_sf$sound.files == x]
x
if (length(x) == 0)
<- NA
x return(x)
})
write.csv(output_data, "./data/processed/owl_song_features_by_sound_file.csv",
row.names = FALSE)
# by species
<- read.csv("./data/processed/song_complexity_features_by_species.csv")
agg_song
<- aggregate(cbind(umap.space.size, tsne.space.size,
mean_sp_data
log.umap.space.size, log.tsne.space.size, peak.frequency, frequency.range,~ species, output_data, mean)
modulation)
$song.duration <- sapply(mean_sp_data$species, function(x) {
mean_sp_data<- agg_song$song.duration[agg_song$species == x]
x
if (length(x) == 0)
<- NA
x return(x)
})
$num.elms <- sapply(mean_sp_data$species, function(x) {
mean_sp_data<- agg_song$num.elms[agg_song$species == x]
x
if (length(x) == 0)
<- NA
x return(x)
})
$elm.types <- sapply(mean_sp_data$species, function(x) {
mean_sp_data<- agg_song$elm.types[agg_song$species == x]
x
if (length(x) == 0)
<- NA
x return(x)
})
write.csv(mean_sp_data, "./data/processed/owl_song_features_by_species.csv",
row.names = FALSE)
9 By sound file
Code
<- read.csv("./data/processed/owl_song_features_by_sound_file.csv")
output_data
.print_df(output_data, height = "1000px")
sound.files | species | umap.space.size | tsne.space.size | log.umap.space.size | log.tsne.space.size | peak.frequency | frequency.range | modulation | elm.duration | song.duration | num.elms | elm.types |
---|---|---|---|---|---|---|---|---|---|---|---|---|
XC102826 - Búho chico - Asio otus otus.wav | Asio otus | 0.002816 | 0.019601 | -5.872517 | 0.019412 | 0.532312 | 4.849784 | 2.43509 | 0.505546 | 0.505546 | 1.00000 | 1.00000 |
XC104027 - Búho pescador leonado - Ketupa flavipes.wav | Ketupa flavipes | 0.178622 | 0.447908 | -1.722486 | 0.370120 | 3.917214 | 1.972928 | 43.16510 | 1.519903 | 1.519903 | 1.00000 | 1.00000 |
XC104661 - Mochuelo de madriguera - Athene cunicularia hypugaea.wav | Athene cunicularia | 0.878136 | 11.981877 | -0.129954 | 2.563554 | 0.982299 | 3.569646 | 1.69613 | 0.318075 | 0.823282 | 2.00000 | 2.00000 |
XC105243 - Mochuelo sijú - Glaucidium siju.wav | Glaucidium siju | 0.023423 | 0.284218 | -3.754018 | 0.250150 | 3.318743 | 3.845932 | 2.88542 | 0.151975 | 0.151975 | 1.00000 | 1.00000 |
XC105374 - Nínox punteado - Ninox punctulata.wav | Ninox punctulata | 5.473665 | 1.912286 | 1.699948 | 1.068938 | 2.020894 | 4.601174 | 3.78490 | 0.134554 | 0.134554 | 1.00000 | 1.00000 |
XC106596 - Mochuelo boreal - Aegolius funereus.wav | Aegolius funereus | 0.262018 | 0.746160 | -1.339342 | 0.557419 | 0.862796 | 0.170338 | 1.07461 | 0.094350 | 1.290096 | 6.84615 | 1.00000 |
XC108715 - Lechuza tenebrosa - Tyto tenebricosa tenebricosa.wav | Tyto tenebricosa | 0.000818 | 0.026963 | -7.108994 | 0.026606 | 3.023934 | 2.839423 | 22.75968 | 1.443127 | 1.443127 | 1.00000 | 1.00000 |
XC113823 - Autillo de las Palau - Pyrroglaux podargina.wav | Pyrroglaux podargina | 2.094540 | 58.461021 | 0.739334 | 4.085321 | 0.766749 | 0.959448 | 2.85104 | 0.114193 | 0.812247 | 1.07534 | 1.02740 |
XC114338 - Nínox maorí - Ninox novaeseelandiae novaeseelandiae.wav | Ninox novaeseelandiae | 1.418552 | 0.869518 | 0.349636 | 0.625681 | 0.885228 | 0.165074 | 4.72301 | 0.195082 | 0.628774 | 2.00000 | 2.00000 |
XC115329 - Autillo montano - Otus spilocephalus spilocephalus_Bhutan.wav | Otus spilocephalus | 0.009822 | 0.052063 | -4.623150 | 0.050753 | 1.522808 | 0.061653 | 2.05236 | 0.151154 | 0.691409 | 2.00000 | 2.00000 |
XC115639 - Mochuelo peludo - Xenoglaux loweryi.wav | Xenoglaux loweryi | 0.003015 | 0.008881 | -5.804203 | 0.008842 | 0.821314 | 0.154538 | 6.85594 | 0.236247 | 0.236247 | 1.00000 | 1.00000 |
XC115660 - Lechuza australiana - Tyto novaehollandiae novaehollandiae_Australia (Darug NP).wav | Tyto novaehollandiae | 0.005398 | 0.018751 | -5.221780 | 0.018577 | 1.865227 | 0.530017 | 27.77014 | 1.342408 | 1.342408 | 1.00000 | 1.00000 |
XC116370 - Búho manchú - Bubo blakistoni.wav | Bubo blakistoni | 0.090202 | 1.596113 | -2.405701 | 0.954015 | 0.243081 | 0.088305 | 2.94998 | 0.244835 | 1.086166 | 4.00000 | 1.00000 |
XC120357 - Autillo persa - Otus brucei brucei.wav | Otus brucei | 0.151570 | 1.107443 | -1.886707 | 0.745475 | 0.510116 | 0.556283 | 2.11675 | 0.141705 | 26.224461 | 25.66667 | 3.00000 |
XC122022 - Nínox de Seram - Ninox squamipila.wav | Ninox squamipila | 0.218762 | 3.481016 | -1.519771 | 1.499850 | 0.404695 | 0.629830 | 2.77191 | 0.090918 | 5.447968 | 29.50000 | 2.00000 |
XC124014 - Mochuelo boliviano - Glaucidium bolivianum.wav | Glaucidium bolivianum | 1.658904 | 0.225202 | 0.506157 | 0.203106 | 1.244974 | 0.574393 | 2.02689 | 0.213495 | 0.213495 | 1.00000 | 1.00000 |
XC127309 - Búho de Guinea - Bubo poensis.wav | Bubo poensis | 0.775924 | 1.911273 | -0.253700 | 1.068591 | 0.359510 | 0.262540 | 1.54027 | 0.032297 | 0.509955 | 9.50000 | 1.00000 |
XC133166 - Mochuelo costarricense - Glaucidium costaricanum.wav | Glaucidium costaricanum | 0.005513 | 0.072813 | -5.200647 | 0.070284 | 1.167201 | 0.097983 | 1.00000 | 0.078053 | 0.078053 | 1.00000 | 1.00000 |
XC133628 - American Barn Owl - Tyto furcata.wav | Tyto furcata | 0.000610 | 0.000202 | -7.401927 | 0.000202 | 2.733019 | 0.913041 | 29.44424 | 0.823740 | 0.823740 | 1.00000 | 1.00000 |
XC134386 - Nínox robusto - Ninox strenua.wav | Ninox strenua | 2.382081 | 18.436618 | 0.867975 | 2.967159 | 0.325914 | 0.390205 | 11.48206 | 0.429839 | 0.865469 | 1.57143 | 1.28571 |
XC140138 - Mochuelo de los saguaros - Micrathene whitneyi.wav | Micrathene whitneyi | 5.008353 | 7.668762 | 1.611107 | 2.159726 | 1.464362 | 2.252471 | 2.15696 | 0.087293 | 2.936988 | 5.94118 | 1.94118 |
XC141909 - Autillo de Java - Otus angelinae.wav | Otus angelinae | 0.034268 | 0.208308 | -3.373532 | 0.189221 | 4.988216 | 4.094984 | 7.03790 | 0.511806 | 1.265487 | 1.90000 | 1.50000 |
XC142493 - Nínox rojizo - Ninox rufa.wav | Ninox rufa | 3.711317 | 3.053315 | 1.311387 | 1.399535 | 0.388954 | 0.032172 | 1.09596 | 0.221671 | 1.028087 | 2.50000 | 1.25000 |
XC147630 - Autillo de Sokoke - Otus ireneae.wav | Otus ireneae | 0.004144 | 0.095459 | -5.485987 | 0.091173 | 0.994258 | 2.030535 | 2.83394 | 0.203512 | 11.640900 | 20.00000 | 1.00000 |
XC148130 - Autillo pálido - Megascops ingens colombianus.wav | Megascops ingens | 0.697936 | 19.032341 | -0.359627 | 2.997348 | 0.871895 | 0.307579 | 1.72144 | 0.129156 | 15.829625 | 52.00000 | 1.25000 |
XC152097 - Nínox bermejo - Ninox ios.wav | Ninox ios | 0.178113 | 4.139702 | -1.725338 | 1.636995 | 0.851492 | 0.493012 | 2.40206 | 0.062581 | 0.128515 | 2.00000 | 2.00000 |
XC152132 - Lechuza de Célebes - Tyto rosenbergii.wav | Tyto rosenbergii | 0.050210 | 0.144931 | -2.991532 | 0.135344 | 2.046839 | 2.558376 | 14.09902 | 0.735043 | 0.735043 | 1.00000 | 1.00000 |
XC152822 - Mochuelo de Parker - Glaucidium parkeri.wav | Glaucidium parkeri | 0.001790 | 0.095785 | -6.325383 | 0.091471 | 1.340145 | 0.040099 | 1.59095 | 0.220290 | 1.351967 | 3.00000 | 1.00000 |
XC153647 - Autillo gorjiblanco - Megascops albogularis.wav | Megascops albogularis | 0.041140 | 0.647381 | -3.190775 | 0.499187 | 0.734842 | 0.057789 | 1.44090 | 0.112827 | 1.247172 | 7.00000 | 1.00000 |
XC15392 - Mochuelo de madriguera - Athene cunicularia.wav | Athene cunicularia | 3.176332 | 14.367384 | 1.155727 | 2.732247 | 0.770247 | 0.689315 | 9.49526 | 0.443150 | 1.302089 | 2.00000 | 2.00000 |
XC154487 - Autillo montano - Otus spilocephalus huttoni_India.wav | Otus spilocephalus | 0.094603 | 0.057534 | -2.358064 | 0.055940 | 1.426617 | 0.024136 | 1.38773 | 0.217502 | 0.982825 | 2.00000 | 1.00000 |
XC154914 - Búho negruzco - Asio stygius robustus.wav | Asio stygius | 0.008143 | 0.001441 | -4.810609 | 0.001440 | 3.438119 | 3.691149 | 4.29160 | 0.211683 | 0.211683 | 1.00000 | 1.00000 |
XC155334 - Mochuelo malgache - Athene superciliaris.wav | Athene superciliaris | 0.010996 | 0.036928 | -4.510198 | 0.036263 | 0.763427 | 0.082824 | 3.09915 | 0.304929 | 0.304929 | 1.00000 | 1.00000 |
XC155335 - Mochuelo malgache - Athene superciliaris.wav | Athene superciliaris | 0.000027 | 0.000029 | -10.518036 | 0.000029 | 0.734842 | 0.377549 | 3.03454 | 0.740544 | 0.740544 | 1.00000 | 1.00000 |
XC155634 - Búho manchú - Bubo blakistoni.wav | Bubo blakistoni | 0.149617 | 1.573349 | -1.899677 | 0.945208 | 0.259307 | 0.055821 | 6.70025 | 0.229004 | 0.829814 | 3.00000 | 1.00000 |
XC155836 - Nínox papú - Ninox theomacha theomacha.wav | Ninox theomacha | 0.078502 | 0.299439 | -2.544634 | 0.261932 | 0.818136 | 0.137906 | 3.95199 | 0.382442 | 1.317101 | 2.00000 | 1.81818 |
XC156513 - Autillo moluqueño - Otus magicus tempestatis.wav | Otus magicus | 0.067280 | 0.585126 | -2.698895 | 0.460664 | 1.208503 | 0.507304 | 3.99913 | 0.167425 | 1.622705 | 2.85714 | 1.00000 |
XC156682 - Autillo montano - Otus spilocephalus_Vietnam.wav | Otus spilocephalus_Vietnam | 0.051936 | 0.366890 | -2.957751 | 0.312538 | 1.621813 | 0.291693 | 1.11199 | 0.160329 | 0.979404 | 2.66667 | 1.66667 |
XC16284 - Mochuelo boliviano - Glaucidium bolivianum.wav | Glaucidium bolivianum | 19.710537 | 6.493658 | 2.981153 | 2.014057 | 1.426617 | 0.465394 | 4.07486 | 0.318730 | 0.318730 | 1.00000 | 1.00000 |
XC163035 - Autillo gorjiblanco - Megascops albogularis.wav | Megascops albogularis | 4.133445 | 14.017687 | 1.419111 | 2.709229 | 0.736473 | 0.261299 | 1.93816 | 0.082901 | 1.146634 | 9.66667 | 1.00000 |
XC164135 - Búho moro - Asio capensis.wav | Asio capensis | 0.159659 | 2.992767 | -1.834718 | 1.384484 | 2.109871 | 3.398595 | 8.56674 | 0.214788 | 1.378201 | 4.66667 | 2.00000 |
XC166218 - Mochuelo moreno - Aegolius ridgwayi.wav | Aegolius ridgwayi | 3.358044 | 2.947523 | 1.211359 | 1.373088 | 1.072365 | 0.459783 | 2.28116 | 0.131491 | 17.553722 | 42.50000 | 1.50000 |
XC166456 - Autillo rajá - Otus brookii.wav | Otus brookii | 0.098533 | 0.091403 | -2.317362 | 0.087464 | 0.997524 | 0.590876 | 7.65247 | 0.223993 | 0.223993 | 1.00000 | 1.00000 |
XC173103 - Lechuza moteada - Tyto multipunctata.wav | Tyto multipunctata | 0.001048 | 0.010374 | -6.861005 | 0.010321 | 2.490574 | 3.222532 | 45.27742 | 2.086998 | 2.086998 | 1.00000 | 1.00000 |
XC173506 - Mochuelo brahmán - Athene brama.wav | Athene brama | 0.013120 | 0.014172 | -4.333649 | 0.014072 | 3.022045 | 5.803037 | 9.48592 | 0.266050 | 2.269086 | 5.50000 | 1.50000 |
XC174183 - Nínox robusto - Ninox strenua.wav | Ninox strenua | 0.040961 | 3.309440 | -3.195129 | 1.460808 | 0.381277 | 0.273273 | 6.11388 | 0.523407 | 1.309573 | 2.00000 | 2.00000 |
XC176735 - Autillo de Moheli - Otus moheliensis.wav | Otus moheliensis | 0.051835 | 0.000000 | -2.959696 | 0.000000 | 1.845141 | 2.891845 | 5.65117 | 0.145031 | 0.145031 | 1.00000 | 1.00000 |
XC177444 - Autillo oriental - Otus sunia leggei.wav | Otus sunia | 0.433275 | 3.009023 | -0.836382 | 1.388548 | 0.939449 | 0.342882 | 3.58951 | 0.108672 | 1.144940 | 3.78261 | 2.86957 |
XC17769 - Mochuelo boreal - Aegolius funereus richardsoni.wav | Aegolius funereus | 0.904881 | 29.890309 | -0.099951 | 3.430443 | 0.794167 | 0.160202 | 1.13051 | 0.051031 | 2.377691 | 21.00000 | 2.00000 |
XC178372 - Autillo oriental - Otus sunia stictonotus.wav | Otus sunia | 0.436905 | 21.719942 | -0.828039 | 3.123243 | 1.178058 | 0.189858 | 2.98990 | 0.211939 | 1.234760 | 2.75000 | 2.75000 |
XC178817 - Autillo flamulado - Psiloscops flammeolus.wav | Psiloscops flammeolus | 1.518335 | 1.297852 | 0.417614 | 0.831975 | 0.456376 | 0.052012 | 2.76473 | 0.201416 | 0.556886 | 1.75000 | 1.50000 |
XC179383 - Nínox punteado - Ninox punctulata.wav | Ninox punctulata | 6.708866 | 2.978217 | 1.903430 | 1.380834 | 1.504270 | 1.798314 | 4.92026 | 0.145330 | 5.833229 | 21.00000 | 3.00000 |
XC182640 - Autillo flamulado - Psiloscops flammeolus.wav | Psiloscops flammeolus | 0.012281 | 0.006285 | -4.399672 | 0.006266 | 0.561898 | 0.032788 | 2.13297 | 0.244824 | 0.244824 | 1.00000 | 1.00000 |
XC182818 - Autillo oriental - Otus sunia stictonotus.wav | Otus sunia | 0.017433 | 2.334332 | -4.049415 | 1.204272 | 0.893180 | 0.197099 | 1.89016 | 0.144649 | 0.996290 | 2.72222 | 1.00000 |
XC184027 - Búho malgache - Asio madagascariensis.wav | Asio madagascariensis | 11.419986 | 48.978936 | 2.435365 | 3.911602 | 1.484761 | 1.466337 | 3.11599 | 0.151668 | 0.151668 | 1.00000 | 1.00000 |
XC188241 - Autillo montano - Otus spilocephalus hambroecki_Taiwan.wav | Otus spilocephalus | 16.075368 | 0.529282 | 2.777288 | 0.424798 | 1.513089 | 0.051441 | 1.58749 | 0.288004 | 1.205141 | 2.00000 | 1.00000 |
XC189030 - Autillo de manglar - Megascops cooperi.wav | Megascops cooperi | 0.188534 | 4.733413 | -1.668476 | 1.746311 | 0.525252 | 0.720345 | 2.35432 | 0.044210 | 2.572361 | 23.00000 | 1.00000 |
XC193879 - Nínox bermejo - Ninox ios undescribed.wav | Ninox ios | 0.245004 | 6.005810 | -1.406479 | 1.946740 | 0.796410 | 0.426211 | 2.04347 | 0.047251 | 0.108117 | 2.00000 | 1.00000 |
XC196205 - Autillo montano - Otus spilocephalus vandewateri.wav | Otus spilocephalus | 0.036906 | 0.277930 | -3.299370 | 0.245242 | 1.426617 | 0.030140 | 2.68587 | 0.231411 | 1.590693 | 2.00000 | 1.00000 |
XC196473 - Mochuelo europeo - Athene noctua.wav | Athene noctua | 0.028167 | 0.402066 | -3.569592 | 0.337947 | 3.798179 | 2.711049 | 1.85171 | 0.065674 | 0.355954 | 2.30000 | 1.00000 |
XC19878_Tyto_rosenbergii.wav | Tyto rosenbergii | 0.000015 | 0.000000 | -11.077476 | 0.000000 | 3.148257 | 1.228319 | 14.30943 | 0.603618 | 0.603618 | 1.00000 | 1.00000 |
XC201045 - Búho nepalí - Bubo nipalensis.wav | Bubo nipalensis | 0.001418 | 0.007778 | -6.558409 | 0.007748 | 1.139950 | 0.105766 | 4.01621 | 0.923097 | 0.923097 | 1.00000 | 1.00000 |
XC203228 - Autillo del Amazonas - Megascops watsonii watsonii.wav | Megascops watsonii | 20.449110 | 16.380003 | 3.017939 | 2.855320 | 0.636297 | 0.132830 | 1.63103 | 0.058632 | 16.498681 | 139.00000 | 2.00000 |
XC203876 - Nínox bermejo - Ninox ios.wav | Ninox ios | 0.222181 | 3.395469 | -1.504265 | 1.480574 | 0.877266 | 0.452695 | 2.57479 | 0.080326 | 0.979011 | 4.00000 | 1.00000 |
XC204281 - Autillo de Java - Otus angelinae.wav | Otus angelinae | 0.408557 | 0.700438 | -0.895123 | 0.530886 | 3.304518 | 5.395956 | 14.94181 | 0.801777 | 1.101052 | 1.25000 | 1.25000 |
XC206574 - Mochuelo cuco - Glaucidium cuculoides.wav | Glaucidium cuculoides | 1.505181 | 3.066475 | 0.408913 | 1.402777 | 0.994609 | 0.152137 | 1.13096 | 0.044652 | 14.338630 | 184.00000 | 1.00000 |
XC206584 - Autillo oriental - Otus sunia sunia.wav | Otus sunia | 0.003904 | 0.237241 | -5.545805 | 0.212884 | 0.880879 | 0.134440 | 3.30864 | 0.142676 | 1.240742 | 3.00000 | 1.50000 |
XC21013 - Autillo de la Simeulue - Otus umbra.wav | Otus umbra | 13.627162 | 2.210114 | 2.612065 | 1.166306 | 2.698862 | 1.835959 | 8.72771 | 0.270883 | 0.270883 | 1.00000 | 1.00000 |
XC210261 - Autillo de la Enggano - Otus enganensis.wav | Otus enganensis | 0.154785 | 0.691173 | -1.865715 | 0.525422 | 0.546350 | 0.291705 | 10.23381 | 0.213864 | 1.018167 | 1.66667 | 1.00000 |
XC210278 - Autillo de las Mentawai - Otus mentawi.wav | Otus mentawi | 0.001946 | 0.026534 | -6.242050 | 0.026188 | 0.967677 | 0.539999 | 8.28251 | 0.226439 | 0.226439 | 1.00000 | 1.00000 |
XC211565 - Mochuelo de jungla - Glaucidium radiatum radiatum.wav | Glaucidium radiatum | 0.027511 | 0.686261 | -3.593179 | 0.522514 | 1.182453 | 0.209743 | 6.33031 | 0.184291 | 0.184291 | 1.00000 | 1.00000 |
XC21184 - Autillo de Andamán - Otus balli.wav | Otus balli | 0.238431 | 1.134396 | -1.433674 | 0.758184 | 0.608674 | 0.710617 | 2.44035 | 0.061699 | 4.636761 | 6.16667 | 1.16667 |
XC214019 - Autillo oriental - Otus sunia.wav | Otus sunia | 0.058001 | 1.281489 | -2.847301 | 0.824828 | 0.821314 | 0.280494 | 3.75236 | 0.202284 | 4.233724 | 6.00000 | 3.00000 |
XC21975 - Autillo rojizo - Otus rufescens malayensis.wav | Otus rufescens | 2.474835 | 2.663651 | 0.906174 | 1.298460 | 0.757493 | 0.483272 | 4.46928 | 0.338109 | 19.099725 | 11.00000 | 2.00000 |
XC22002 - Autillo montano - Otus spilocephalus vulpes.wav | Otus spilocephalus | 0.034842 | 0.008788 | -3.356919 | 0.008750 | 1.670787 | 0.058332 | 2.17355 | 0.228693 | 29.018624 | 6.00000 | 1.00000 |
XC227082 - Autillo de Santa Catarina - Megascops sanctaecatarinae.wav | Megascops sanctaecatarinae | 1.942468 | 24.534086 | 0.663959 | 3.240014 | 0.939440 | 0.329143 | 3.70593 | 0.083101 | 4.641932 | 31.50000 | 2.00000 |
XC23079 - Autillo de Luzón - Otus longicornis.wav | Otus longicornis | 0.000197 | 0.001274 | -8.531213 | 0.001273 | 1.080729 | 0.071851 | 3.91079 | 0.473730 | 24.949227 | 6.00000 | 1.00000 |
XC23085 - Autillo orejudo de Luzón - Otus megalotis.wav | Otus megalotis | 2.340469 | 41.025645 | 0.850351 | 3.738280 | 0.966300 | 0.461867 | 5.20054 | 0.416445 | 4.706466 | 4.00000 | 2.00000 |
XC23089 - Autillo de la Sangihe - Otus collari.wav | Otus collari | 4.382448 | 4.301202 | 1.477608 | 1.667934 | 1.772505 | 0.040956 | 3.27396 | 0.464944 | 21.525873 | 2.50000 | 1.00000 |
XC233344 - Mochuelo pechirrojo - Glaucidium tephronotum.wav | Glaucidium tephronotum | 0.000206 | 0.000390 | -8.489989 | 0.000390 | 1.253673 | 0.063326 | 6.76134 | 0.779293 | 0.779293 | 1.00000 | 1.00000 |
XC233963 - Búho chico - Asio otus.wav | Asio otus | 0.000316 | 0.000188 | -8.060000 | 0.000188 | 0.475426 | 0.038812 | 1.91668 | 0.530353 | 0.530353 | 1.00000 | 1.00000 |
XC23645 - Mochuelo boliviano - Glaucidium bolivianum.wav | Glaucidium bolivianum | 22.460303 | 17.428849 | 3.111749 | 2.913917 | 1.422356 | 2.770967 | 2.47913 | 0.234193 | 6.943553 | 9.50000 | 2.50000 |
XC236818 - Mochuelo tamaulipeco - Glaucidium sanchezi.wav | Glaucidium sanchezi | 0.002338 | 0.001983 | -6.058303 | 0.001981 | 1.472984 | 1.525044 | 4.08258 | 0.305634 | 6.201964 | 4.00000 | 2.00000 |
XC238463 - Autillo pálido - Megascops ingens ingens.wav | Megascops ingens | 0.557906 | 6.090442 | -0.583564 | 1.958748 | 0.755168 | 0.124494 | 2.41514 | 0.093154 | 14.809537 | 82.00000 | 1.00000 |
XC238469 - Autillo pálido - Megascops ingens ingens.wav | Megascops ingens | 0.312322 | 1.502342 | -1.163719 | 0.917227 | 1.102362 | 0.085590 | 8.34276 | 0.543964 | 0.543964 | 1.00000 | 1.00000 |
XC238483 - Autillo de Peterson - Megascops petersoni.wav | Megascops petersoni | 5.187190 | 36.707416 | 1.646192 | 3.629857 | 0.652995 | 0.350691 | 5.75951 | 0.144967 | 2.417030 | 11.83333 | 1.00000 |
XC238939 - Lechuzón acollarado grande - Pulsatrix melanota melanota.wav | Pulsatrix melanota | 2.874262 | 15.660409 | 1.055796 | 2.813035 | 0.659063 | 0.334319 | 1.30147 | 0.036436 | 0.067688 | 1.84211 | 1.68421 |
XC240652 - Autillo montano - Otus spilocephalus_Cambodia.wav | Otus spilocephalus_Cambodia | 0.064011 | 0.481554 | -2.748694 | 0.393091 | 1.517441 | 0.101094 | 2.69805 | 0.273946 | 0.273946 | 1.00000 | 1.00000 |
XC241437 - Búho de Akún - Bubo leucostictus.wav | Bubo leucostictus | 0.069292 | 0.067688 | -2.669424 | 0.065496 | 1.191843 | 0.204687 | 6.73411 | 0.569856 | 0.569856 | 1.00000 | 1.00000 |
XC243538 - Autillo montano - Otus spilocephalus.wav | Otus spilocephalus | 0.024981 | 0.006907 | -3.689633 | 0.006883 | 1.426617 | 0.036212 | 1.00000 | 0.147422 | 0.602122 | 2.00000 | 1.00000 |
XC24648 - Nínox de la Manus - Ninox meeki.wav | Ninox meeki | 0.072058 | 0.744396 | -2.630285 | 0.556408 | 0.505375 | 0.359521 | 6.83441 | 0.127148 | 0.177734 | 1.35000 | 1.00000 |
XC251096 - Autillo peruano - Megascops roboratus roboratus.wav | Megascops roboratus | 0.726562 | 3.548704 | -0.319431 | 1.514842 | 0.631634 | 0.556545 | 1.01868 | 0.020530 | 2.572310 | 69.00000 | 1.00000 |
XC257739 - Autillo chóliba - Megascops choliba cruciger.wav | Megascops choliba | 1.461295 | 19.665664 | 0.379323 | 3.028474 | 0.586006 | 0.677551 | 1.91201 | 0.090510 | 1.354386 | 12.50000 | 2.00000 |
XC260422 - Autillo del Amazonas - Megascops watsonii.wav | Megascops watsonii | 0.812802 | 2.127488 | -0.207268 | 1.140230 | 0.734842 | 0.265724 | 3.39155 | 0.182922 | 0.182922 | 1.00000 | 1.00000 |
XC260426 - Mochuelo ecuatoriano - Glaucidium nubicola.wav | Glaucidium nubicola | 0.004142 | 0.405946 | -5.486679 | 0.340710 | 1.253673 | 0.031235 | 2.02329 | 0.148629 | 0.148629 | 1.00000 | 1.00000 |
XC261636 - Autillo gorjiblanco - Megascops albogularis albogularis.wav | Megascops albogularis | 1.347730 | 11.825303 | 0.298421 | 2.551420 | 0.734842 | 0.057669 | 1.16331 | 0.064812 | 0.690161 | 7.50000 | 1.00000 |
XC264434 - Autillo del Amazonas - Megascops watsonii.wav | Megascops watsonii | 1.872914 | 17.822523 | 0.627495 | 2.935054 | 0.644303 | 0.179529 | 2.59663 | 0.121142 | 0.121142 | 1.00000 | 1.00000 |
XC264436 - Mochuelo andino - Glaucidium jardinii.wav | Glaucidium jardinii | 15.547392 | 47.725134 | 2.743893 | 3.886195 | 1.272428 | 0.808619 | 2.12807 | 0.150912 | 0.161526 | 1.06667 | 1.06667 |
XC268046 - Autillo de Flores - Otus alfredi.wav | Otus alfredi | 5.850301 | 0.216039 | 1.766493 | 0.195599 | 1.241033 | 0.810919 | 1.00000 | 0.023704 | 1.202995 | 12.00000 | 1.00000 |
XC269968 - Autillo de Luzón - Otus longicornis.wav | Otus longicornis | 0.004423 | 0.113686 | -5.420951 | 0.107675 | 1.167201 | 0.038900 | 1.00000 | 0.142382 | 0.335162 | 2.00000 | 2.00000 |
XC272891 - Autillo fresco - Megascops hoyi.wav | Megascops hoyi | 0.390270 | 10.050997 | -0.940916 | 2.402521 | 0.812346 | 0.933723 | 1.75390 | 0.046791 | 37.860381 | 37.00000 | 1.00000 |
XC273547 - Cárabo blanquinegro - Strix nigrolineata.wav | Strix nigrolineata | 0.830578 | 9.446486 | -0.185633 | 2.346266 | 0.682280 | 0.507564 | 3.49416 | 0.128522 | 1.451524 | 6.00000 | 4.00000 |
XC276019 - Mochuelo ecuatoriano - Glaucidium nubicola.wav | Glaucidium nubicola | 0.002104 | 0.004694 | -6.163760 | 0.004683 | 1.513089 | 0.135718 | 5.09931 | 0.164934 | 0.503753 | 2.00000 | 2.00000 |
XC27666 - Autillo rojizo - Otus rufescens.wav | Otus rufescens | 0.000019 | 0.000000 | -10.882516 | 0.000000 | 0.952312 | 0.040593 | 3.56978 | 0.550673 | 0.550673 | 1.00000 | 1.00000 |
XC276794 - Autillo chóliba - Megascops choliba luctisonus.wav | Megascops choliba | 1.645943 | 19.724716 | 0.498313 | 3.031327 | 0.703829 | 0.671997 | 2.00881 | 0.067630 | 1.025532 | 12.00000 | 4.00000 |
XC278971 - Mochuelo centroamericano - Glaucidium griseiceps.wav | Glaucidium griseiceps | 0.001105 | 0.009186 | -6.808280 | 0.009144 | 1.426617 | 0.033439 | 1.13980 | 0.164162 | 2.339863 | 7.00000 | 2.00000 |
XC283089 - Mochuelo gnomo - Glaucidium gnoma.wav | Glaucidium gnoma | 1.555470 | 0.634923 | 0.441778 | 0.491596 | 1.163530 | 0.119916 | 1.73246 | 0.114348 | 0.114348 | 1.00000 | 1.00000 |
XC283239 - Búho malayo - Bubo sumatranus.wav | Bubo sumatranus | 0.087578 | 0.008129 | -2.435223 | 0.008096 | 0.388954 | 0.045590 | 1.82100 | 0.256551 | 1.575678 | 2.00000 | 2.00000 |
XC283816 - Nínox de las Salomón occidentales - Ninox jacquinoti granti.wav | Ninox jacquinoti | 0.085297 | 0.395365 | -2.461616 | 0.333156 | 1.341072 | 0.957580 | 4.90663 | 0.193772 | 0.645474 | 3.00000 | 1.00000 |
XC286959 - Autillo yanqui - Megascops asio.wav | Megascops asio | 5.157812 | 13.364043 | 1.640512 | 2.664728 | 1.137326 | 0.384349 | 11.70421 | 0.191317 | 0.240371 | 1.23913 | 1.06522 |
XC288754 - Autillo de Wallace - Otus silvicola.wav | Otus silvicola | 0.026807 | 0.120798 | -3.619095 | 0.114041 | 0.875681 | 0.381559 | 5.74345 | 0.163551 | 0.163551 | 1.00000 | 1.00000 |
XC288755 - Autillo de Wallace - Otus silvicola.wav | Otus silvicola | 0.107353 | 0.311330 | -2.231631 | 0.271042 | 0.840643 | 0.260962 | 5.67520 | 0.166103 | 0.166103 | 1.00000 | 1.00000 |
XC290186 - Nínox de las Salomón occidentales - Ninox jacquinoti jacquinoti.wav | Ninox jacquinoti | 0.348019 | 1.909885 | -1.055499 | 1.068113 | 0.722525 | 0.358919 | 16.78093 | 0.618357 | 0.875190 | 1.37500 | 1.12500 |
XC290524 - Mochuelo acollarado - Glaucidium brodiei.wav | Glaucidium brodiei | 0.024492 | 0.268235 | -3.709408 | 0.237626 | 0.994258 | 0.044098 | 1.09340 | 0.122147 | 1.535388 | 4.00000 | 1.33333 |
XC29068 - Autillo europeo - Otus scops pulchellus.wav | Otus scops | 0.000115 | 0.000362 | -9.066494 | 0.000362 | 1.340145 | 0.043772 | 1.13936 | 0.281838 | 0.281838 | 1.00000 | 1.00000 |
XC291902 - Autillo de Madagascar - Otus madagascariensis.wav | Otus madagascariensis | 0.003382 | 0.165940 | -5.689374 | 0.153528 | 1.154697 | 0.517648 | 2.13816 | 0.146172 | 2.232992 | 6.00000 | 1.00000 |
XC295561 - Autillo de Nicobar - Otus alius.wav | Otus alius | 0.014398 | 0.128985 | -4.240691 | 0.121319 | 2.082913 | 0.493455 | 4.09202 | 0.461646 | 0.461646 | 1.00000 | 1.00000 |
XC295871 - Autillo oriental - Otus sunia.wav | Otus sunia | 0.014770 | 0.119492 | -4.215189 | 0.112875 | 0.821314 | 0.771139 | 2.33681 | 0.129074 | 1.658663 | 4.00000 | 2.00000 |
XC296147 - Cárabo bataraz - Strix rufipes.wav | Strix rufipes | 1.738389 | 17.423030 | 0.552959 | 2.913602 | 0.563782 | 1.340995 | 2.85620 | 0.081771 | 0.089170 | 1.08000 | 1.00000 |
XC296730 - Autillo de Marshall - Megascops marshalli.wav | Megascops marshalli | 1.509747 | 4.880979 | 0.411942 | 1.771723 | 0.668698 | 0.155776 | 1.13435 | 0.055772 | 0.055772 | 1.00000 | 1.00000 |
XC297097 - Mochuelo peruano - Glaucidium peruanum.wav | Glaucidium peruanum | 0.158240 | 2.501399 | -1.843645 | 1.253163 | 1.379543 | 0.389615 | 1.61566 | 0.049119 | 14.043791 | 88.00000 | 1.00000 |
XC299359 - Autillo elegante - Otus elegans interpositus.wav | Otus elegans | 3.898101 | 7.384199 | 1.360489 | 2.126349 | 0.877576 | 0.147232 | 3.85680 | 0.117713 | 0.251165 | 2.00000 | 2.00000 |
XC300004 - Búho de El Cabo - Bubo capensis.wav | Bubo capensis | 3.341261 | 13.779503 | 1.206348 | 2.693241 | 0.464808 | 0.115776 | 2.36414 | 0.195512 | 0.195512 | 1.00000 | 1.00000 |
XC300005 - Búho ceniciento - Bubo cinerascens.wav | Bubo cinerascens | 1.742301 | 3.501002 | 0.555207 | 1.504300 | 0.444314 | 0.189958 | 3.87982 | 0.281799 | 1.958481 | 2.50000 | 2.00000 |
XC301445 - Nínox de Seram - Ninox squamipila.wav | Ninox squamipila | 0.871469 | 3.224474 | -0.137575 | 1.440895 | 0.169760 | 0.286880 | 2.29631 | 0.073383 | 0.075061 | 1.01667 | 1.00000 |
XC301969 - Lechuza de Célebes - Tyto rosenbergii rosenbergii.wav | Tyto rosenbergii | 0.002221 | 0.006394 | -6.109813 | 0.006374 | 3.828635 | 2.799332 | 18.38440 | 0.729675 | 0.729675 | 1.00000 | 1.00000 |
XC303394 - Mochuelo andino - Glaucidium jardinii.wav | Glaucidium jardinii | 0.965550 | 0.379482 | -0.035058 | 0.321708 | 1.337321 | 1.204645 | 1.93284 | 0.114528 | 60.998521 | 47.00000 | 1.00000 |
XC303751 - Lechuza de La Española - Tyto glaucops.wav | Tyto glaucops | 0.815766 | 3.709118 | -0.203628 | 1.549501 | 2.073895 | 5.596116 | 34.01387 | 1.051907 | 1.172658 | 1.11111 | 1.11111 |
XC307037 - Cárabo gavilán - Surnia ulula.wav | Surnia ulula | 3.845855 | 37.161243 | 1.346996 | 3.641820 | 0.873611 | 2.061844 | 1.10287 | 0.045932 | 6.886741 | 86.00000 | 1.00000 |
XC30727 - Nínox de Luzón - Ninox philippensis.wav | Ninox philippensis | 2.007635 | 15.891819 | 0.696957 | 2.826829 | 0.802589 | 0.369430 | 4.73391 | 0.178633 | 1.116727 | 2.57143 | 1.71429 |
XC308152 - Autillo californiano - Megascops kennicottii.wav | Megascops kennicottii | 1.739557 | 28.435979 | 0.553630 | 3.382218 | 0.967252 | 4.973509 | 1.60454 | 0.057981 | 28.322821 | 31.00000 | 1.00000 |
XC308530 - Autillo puertorriqueño - Megascops nudipes.wav | Megascops nudipes | 14.732837 | 100.000000 | 2.690079 | 4.615121 | 0.654388 | 1.025208 | 1.55377 | 0.042998 | 4.871391 | 60.00000 | 1.00000 |
XC311403 - Autillo indio - Otus bakkamoena.wav | Otus bakkamoena | 0.030066 | 0.139050 | -3.504365 | 0.130195 | 1.037635 | 0.604775 | 3.32721 | 0.147563 | 0.147563 | 1.00000 | 1.00000 |
XC311406 - Autillo de Thilo Hoffmann - Otus thilohoffmanni.wav | Otus thilohoffmanni | 0.000331 | 0.000541 | -8.014660 | 0.000541 | 0.734842 | 0.129472 | 2.06928 | 0.259252 | 0.259252 | 1.00000 | 1.00000 |
XC312098 - Lechuza tenebrosa - Tyto tenebricosa tenebricosa.wav | Tyto tenebricosa | 0.008458 | 0.071217 | -4.772625 | 0.068796 | 2.911346 | 3.123181 | 16.62186 | 1.653707 | 1.653707 | 1.00000 | 1.00000 |
XC314000 - Nínox de Sumba chico - Ninox sumbaensis.wav | Ninox sumbaensis | 2.033480 | 11.928540 | 0.709749 | 2.559437 | 0.863566 | 0.351644 | 3.18870 | 0.252015 | 0.401938 | 1.33333 | 1.33333 |
XC315138 - Autillo chino - Otus lettia lettia.wav | Otus lettia | 0.000225 | 0.002216 | -8.397800 | 0.002214 | 0.734842 | 0.113716 | 2.69694 | 0.291849 | 0.291849 | 1.00000 | 1.00000 |
XC315140 - Autillo frentiblanco - Otus sagittatus.wav | Otus sagittatus | 12.515753 | 4.992899 | 2.526988 | 1.790575 | 0.384884 | 0.160574 | 1.13446 | 0.042939 | 0.042939 | 1.00000 | 1.00000 |
XC315419 - Nínox de Sumba grande - Ninox rudolfi.wav | Ninox rudolfi | 0.113216 | 3.010291 | -2.178455 | 1.388864 | 0.275822 | 0.401174 | 2.52740 | 0.051977 | 0.051977 | 1.00000 | 1.00000 |
XC315989 - Búho moro - Asio capensis.wav | Asio capensis | 0.081626 | 1.137070 | -2.505606 | 0.759436 | 2.074246 | 3.273886 | 5.67350 | 0.159461 | 0.159461 | 1.00000 | 1.00000 |
XC317630 - Búho ceniciento - Bubo cinerascens.wav | Bubo cinerascens | 0.000927 | 0.000760 | -6.983245 | 0.000760 | 0.475426 | 0.455641 | 3.14525 | 0.229422 | 0.229422 | 1.00000 | 1.00000 |
XC320214 - Autillo de Palawan - Otus fuliginosus.wav | Otus fuliginosus | 0.004500 | 0.005143 | -5.403621 | 0.005130 | 0.994258 | 0.727259 | 18.01121 | 0.876024 | 0.876024 | 1.00000 | 1.00000 |
XC32359 - Nínox de las Salomón occidentales - Ninox jacquinoti roseoaxillaris.wav | Ninox jacquinoti | 0.005883 | 0.034000 | -5.135720 | 0.033434 | 0.821314 | 0.043461 | 1.55613 | 0.253186 | 0.253186 | 1.00000 | 1.00000 |
XC325226 - Búho americano - Bubo virginianus.wav | Bubo virginianus | 0.617879 | 1.149932 | -0.481462 | 0.765436 | 0.388954 | 0.339635 | 3.00863 | 0.257168 | 2.142170 | 4.00000 | 3.00000 |
XC325475 - Autillo del Balsas - Megascops seductus.wav | Megascops seductus | 0.182683 | 0.675229 | -1.700003 | 0.515950 | 0.695981 | 0.282010 | 2.22752 | 0.087728 | 1.821760 | 8.00000 | 1.00000 |
XC326933 - Lechuza australiana - Tyto novaehollandiae castanops_Tasmania.wav | Tyto novaehollandiae | 0.003037 | 0.051616 | -5.796774 | 0.050328 | 3.079010 | 3.640508 | 24.27079 | 0.965437 | 0.965437 | 1.00000 | 1.00000 |
XC327613 - Mochuelo de los saguaros - Micrathene whitneyi.wav | Micrathene whitneyi | 0.074680 | 0.068121 | -2.594544 | 0.065901 | 1.688903 | 0.772454 | 1.97420 | 0.098739 | 0.098739 | 1.00000 | 1.00000 |
XC327632 - Mochuelo de Colima - Glaucidium palmarum.wav | Glaucidium palmarum | 0.001256 | 0.088148 | -6.680188 | 0.084477 | 1.412556 | 0.099645 | 2.07397 | 0.123847 | 4.301247 | 12.50000 | 1.00000 |
XC329833 - Autillo europeo - Otus scops.wav | Otus scops | 20.104714 | 0.530356 | 3.000954 | 0.425500 | 1.439987 | 0.230165 | 2.19995 | 0.206233 | 0.206233 | 1.00000 | 1.00000 |
XC330307 - Autillo bigotudo - Megascops trichopsis.wav | Megascops trichopsis | 0.096140 | 1.300165 | -2.341953 | 0.832981 | 0.751050 | 0.107732 | 1.85853 | 0.116273 | 1.207497 | 6.50000 | 3.00000 |
XC330400 - Lechuza australiana - Tyto novaehollandiae.wav | Tyto novaehollandiae | 0.007888 | 0.330150 | -4.842465 | 0.285292 | 3.509437 | 3.849741 | 19.19224 | 0.921236 | 0.944104 | 1.02083 | 1.02083 |
XC330547 - Búho corniblanco - Lophostrix cristata.wav | Lophostrix cristata | 0.043330 | 0.202557 | -3.138911 | 0.184450 | 0.475426 | 0.066205 | 7.87235 | 0.286016 | 0.286016 | 1.00000 | 1.00000 |
XC3311 - Cárabo blanquinegro - Strix nigrolineata.wav | Strix nigrolineata | 0.623391 | 9.158597 | -0.472581 | 2.318320 | 0.556992 | 0.601144 | 3.56065 | 0.107680 | 0.107680 | 1.00000 | 1.00000 |
XC332168 - Autillo de Mindanao - Otus mirus.wav | Otus mirus | 0.119356 | 0.002716 | -2.125643 | 0.002712 | 1.340145 | 0.012557 | 2.23478 | 0.307384 | 1.440753 | 2.00000 | 2.00000 |
XC332184 - Búho de Mindanao - Otus gurneyi.wav | Otus gurneyi | 0.028511 | 0.382453 | -3.557482 | 0.323860 | 0.697034 | 0.705641 | 9.32677 | 0.458441 | 0.458441 | 1.00000 | 1.00000 |
XC332440 - Autillo guatemalteco - Megascops guatemalae.wav | Megascops guatemalae | 3.392317 | 7.938943 | 1.221513 | 2.190417 | 0.648370 | 0.136202 | 1.07292 | 0.036208 | 10.714143 | 147.00000 | 1.00000 |
XC33770 - Nínox maorí - Ninox novaeseelandiae.wav | Ninox novaeseelandiae | 0.006431 | 0.005748 | -5.046650 | 0.005732 | 0.821314 | 0.716898 | 2.50845 | 0.237444 | 0.659324 | 2.00000 | 2.00000 |
XC337743 - Autillo de Santo Tomé - Otus hartlaubi.wav | Otus hartlaubi | 0.005344 | 0.006592 | -5.231755 | 0.006570 | 1.482866 | 0.131996 | 3.78277 | 0.367079 | 0.367079 | 1.00000 | 1.00000 |
XC340505 - Autillo africano - Otus senegalensis feae.wav | Otus senegalensis | 0.012838 | 0.539204 | -4.355381 | 0.431266 | 1.167201 | 0.115610 | 8.84160 | 0.420802 | 0.420802 | 1.00000 | 1.00000 |
XC341785 - Cárabo chaqueño - Strix chacoensis.wav | Strix chacoensis | 2.339603 | 38.897804 | 0.849981 | 3.686321 | 0.628569 | 0.627609 | 7.31576 | 0.145531 | 0.395921 | 2.33333 | 1.13333 |
XC343142 - Autillo europeo - Otus scops.wav | Otus scops | 0.001013 | 0.001336 | -6.894576 | 0.001335 | 1.340145 | 0.035456 | 1.43595 | 0.364262 | 17.142158 | 7.00000 | 1.00000 |
XC343144 - Búho nival - Bubo scandiacus.wav | Bubo scandiacus | 0.008923 | 0.000000 | -4.719113 | 0.000000 | 0.388954 | 0.047536 | 6.33689 | 0.385721 | 0.385721 | 1.00000 | 1.00000 |
XC343145 - Búho nival - Bubo scandiacus.wav | Bubo scandiacus | 0.562130 | 8.497698 | -0.576021 | 2.251049 | 0.636294 | 0.576779 | 3.45181 | 0.093625 | 0.098519 | 1.04167 | 1.00000 |
XC344009 - Búho magallánico - Bubo magellanicus.wav | Bubo magellanicus | 1.309045 | 13.855648 | 0.269298 | 2.698380 | 0.427820 | 0.378327 | 5.55928 | 0.178408 | 0.495776 | 2.00000 | 2.00000 |
XC344453 - Autillo japonés - Otus semitorques.wav | Otus semitorques | 0.349898 | 0.361813 | -1.050114 | 0.308817 | 0.216010 | 0.091757 | 1.04376 | 0.176836 | 21.145991 | 31.50000 | 1.00000 |
XC345655 - Cárabo pescador rojizo - Scotopelia ussheri.wav | Scotopelia ussheri | 0.044164 | 2.652019 | -3.119839 | 1.295280 | 0.302482 | 0.271824 | 6.25977 | 0.450984 | 0.450984 | 1.00000 | 1.00000 |
XC345656 - Cárabo pescador rojizo - Scotopelia ussheri.wav | Scotopelia ussheri | 0.026930 | 0.000000 | -3.614515 | 0.000000 | 0.302482 | 0.301127 | 2.64413 | 0.189791 | 0.189791 | 1.00000 | 1.00000 |
XC346134 - Mochuelo de Ceilán - Glaucidium castanotum.wav | Glaucidium castanotum | 1.119776 | 0.912573 | 0.113129 | 0.648449 | 0.975990 | 3.861713 | 3.72843 | 0.238754 | 1.414737 | 3.66667 | 1.66667 |
XC346212 - Mochuelo de Ceilán - Glaucidium castanotum.wav | Glaucidium castanotum | 4.307615 | 18.876537 | 1.460384 | 2.989540 | 0.970380 | 3.344746 | 4.66458 | 0.219324 | 0.219324 | 1.00000 | 1.00000 |
XC346931 - Autillo africano - Otus senegalensis.wav | Otus senegalensis | 0.000848 | 0.011269 | -7.072812 | 0.011206 | 1.080729 | 0.172409 | 6.33323 | 0.231818 | 0.231818 | 1.00000 | 1.00000 |
XC348763 - Nínox maorí - Ninox novaeseelandiae.wav | Ninox novaeseelandiae | 8.660880 | 0.397576 | 2.158816 | 0.334739 | 0.867471 | 0.153180 | 6.56194 | 0.279724 | 0.279724 | 1.00000 | 1.00000 |
XC349174 - Nínox de Andamán - Ninox affinis.wav | Ninox affinis | 0.027716 | 0.207044 | -3.585761 | 0.188175 | 0.957516 | 0.242717 | 9.32735 | 0.426239 | 0.426239 | 1.00000 | 1.00000 |
XC349601 - Nínox australiano - Ninox boobook cinnamomina.wav | Ninox boobook | 0.135332 | 1.103223 | -2.000026 | 0.743471 | 0.670872 | 0.121393 | 4.38809 | 0.217891 | 0.217891 | 1.00000 | 1.00000 |
XC351338 - Cárabo guatemalteco - Strix fulvescens.wav | Strix fulvescens | 1.622790 | 2.142382 | 0.484147 | 1.144981 | 0.734842 | 0.267656 | 3.34930 | 0.249565 | 1.973563 | 5.00000 | 3.00000 |
XC351699 - Autillo bigotudo - Megascops trichopsis trichopsis.wav | Megascops trichopsis | 0.671054 | 6.523816 | -0.398905 | 2.018073 | 0.728674 | 0.149165 | 2.22912 | 0.136201 | 2.916972 | 13.00000 | 2.00000 |
XC352949 - Autillo de la Sonda - Otus lempiji lempiji.wav | Otus lempiji | 0.122392 | 0.353950 | -2.100526 | 0.303026 | 0.907786 | 0.225978 | 4.37670 | 0.280678 | 0.280678 | 1.00000 | 1.00000 |
XC354265 - Autillo colombiano - Megascops colombianus.wav | Megascops colombianus | 0.060705 | 0.552074 | -2.801730 | 0.439592 | 0.886434 | 0.963319 | 1.73827 | 0.115854 | 3.991732 | 18.50000 | 1.50000 |
XC355034 - Autillo serrano - Megascops clarkii.wav | Megascops clarkii | 1.814415 | 0.629533 | 0.595763 | 0.488293 | 0.732425 | 0.054892 | 1.93633 | 0.240429 | 1.881021 | 4.50000 | 1.00000 |
XC355039 - Mochuelo moreno - Aegolius ridgwayi.wav | Aegolius ridgwayi | 0.632303 | 7.827826 | -0.458387 | 2.177909 | 0.989688 | 0.110300 | 1.62268 | 0.155501 | 5.006972 | 11.50000 | 1.00000 |
XC355112 - Cárabo oriental - Strix leptogrammica.wav | Strix leptogrammica | 0.027051 | 0.118649 | -3.610017 | 0.112121 | 1.601716 | 4.769466 | 10.07863 | 1.541573 | 1.541573 | 1.00000 | 1.00000 |
XC356748 - Autillo oriental - Otus sunia.wav | Otus sunia | 1.024913 | 3.578088 | 0.024608 | 1.521282 | 0.864355 | 0.233509 | 3.99864 | 0.131407 | 1.407273 | 3.00000 | 3.00000 |
XC358391 - Autillo oriental - Otus sunia.wav | Otus sunia | 0.004610 | 0.112883 | -5.379428 | 0.106954 | 0.873145 | 0.283269 | 2.90678 | 0.115093 | 2.066724 | 3.00000 | 2.00000 |
XC359029 - Autillo europeo - Otus scops mallorcae.wav | Otus scops | 0.002038 | 0.000050 | -6.195690 | 0.000050 | 1.197229 | 0.059748 | 1.66202 | 0.295445 | 0.295445 | 1.00000 | 1.00000 |
XC359212 - Mochuelo centroamericano - Glaucidium griseiceps.wav | Glaucidium griseiceps | 0.006077 | 0.198778 | -5.103275 | 0.181303 | 1.426617 | 0.052274 | 1.40789 | 0.155677 | 3.272079 | 10.00000 | 1.00000 |
XC359941 - Autillo montano - Otus spilocephalus_Malaysia_Borneo.wav | Otus spilocephalus_Malaysia_Borneo | 0.000266 | 0.000639 | -8.233409 | 0.000639 | 1.340145 | 0.046274 | 1.33093 | 0.232260 | 1.175166 | 2.00000 | 1.00000 |
XC359984 - Lechuza cornuda oriental - Phodilus badius.wav | Phodilus badius | 0.762577 | 0.715946 | -0.271052 | 0.539965 | 1.423056 | 0.441844 | 5.21981 | 0.339659 | 0.665920 | 1.66667 | 1.16667 |
XC360574 - Autillo californiano - Megascops kennicottii.wav | Megascops kennicottii | 0.018355 | 0.091778 | -3.997866 | 0.087808 | 0.648370 | 0.044774 | 1.25957 | 0.080756 | 0.435119 | 2.44444 | 1.00000 |
XC363191 - Lechuza de Minahassa - Tyto inexspectata.wav | Tyto inexspectata | 0.025896 | 0.082424 | -3.653663 | 0.079203 | 1.861903 | 3.448776 | 7.27618 | 0.613382 | 1.712926 | 2.00000 | 1.00000 |
XC366990 - Lechuza cornuda de Ceilán - Phodilus assimilis.wav | Phodilus assimilis | 0.298685 | 0.933551 | -1.208366 | 0.659358 | 1.381487 | 0.576004 | 8.08853 | 1.011961 | 5.422994 | 4.00000 | 3.00000 |
XC368289 - Búho americano - Bubo virginianus saturatus.wav | Bubo virginianus | 0.420699 | 3.219475 | -0.865839 | 1.439711 | 0.442467 | 0.417235 | 2.50983 | 0.310973 | 2.125425 | 4.00000 | 2.00000 |
XC368482 - Autillo yanqui - Megascops asio mccallii.wav | Megascops asio | 1.971103 | 6.079674 | 0.678593 | 1.957228 | 0.638655 | 0.209412 | 1.02390 | 0.023959 | 33.178980 | 99.00000 | 1.00000 |
XC368856 - Cárabo norteamericano - Strix varia.wav | Strix varia | 3.105006 | 15.555157 | 1.133016 | 2.806698 | 0.592474 | 0.616836 | 4.18232 | 0.171048 | 2.869034 | 8.00000 | 2.00000 |
XC369358 - Nínox de Andamán - Ninox affinis.wav | Ninox affinis | 0.000789 | 0.007731 | -7.144282 | 0.007701 | 0.907786 | 0.127930 | 12.45196 | 0.492705 | 18.412553 | 7.00000 | 1.00000 |
XC369390 - Autillo indio - Otus bakkamoena.wav | Otus bakkamoena | 0.025879 | 0.230568 | -3.654317 | 0.207476 | 1.206463 | 0.626179 | 3.01644 | 0.172894 | 53.002782 | 19.00000 | 1.00000 |
XC369395 - Autillo oriental - Otus sunia.wav | Otus sunia | 5.012679 | 0.131919 | 1.611970 | 0.123915 | 0.984415 | 0.250339 | 4.78184 | 0.154982 | 0.876954 | 3.00000 | 3.00000 |
XC369807 - Cárabo de las pagodas - Strix seloputo.wav | Strix seloputo | 0.641205 | 18.635232 | -0.444406 | 2.977326 | 0.505319 | 0.347387 | 13.14368 | 0.432004 | 0.670070 | 1.20000 | 1.00000 |
XC370199 - Autillo bigotudo - Megascops trichopsis.wav | Megascops trichopsis | 0.123121 | 1.450361 | -2.094586 | 0.896236 | 0.728037 | 0.109034 | 1.20642 | 0.074341 | 4.846171 | 21.00000 | 1.00000 |
XC374384 - Mochuelo cabezón - Aegolius acadicus.wav | Aegolius acadicus | 5.312509 | 2.409878 | 1.670064 | 1.226676 | 1.340145 | 0.078131 | 2.02061 | 0.127367 | 49.066202 | 18.00000 | 1.00000 |
XC377385 - Autillo oriental - Otus sunia japonicus.wav | Otus sunia | 0.064147 | 9.188956 | -2.746586 | 2.321304 | 1.080729 | 0.248624 | 1.29595 | 0.149223 | 0.534507 | 2.33333 | 1.66667 |
XC379266 - Autillo oriental - Otus sunia malayanus.wav | Otus sunia | 0.125197 | 2.938203 | -2.077870 | 1.370724 | 1.020154 | 0.212683 | 4.53956 | 0.149979 | 1.045285 | 3.00000 | 2.00000 |
XC379879 - Autillo elegante - Otus elegans.wav | Otus elegans | 0.001939 | 0.030529 | -6.245626 | 0.030073 | 0.734842 | 0.040634 | 2.43563 | 0.271450 | 11.381788 | 5.00000 | 1.00000 |
XC380104 - Búho gritón - Pseudoscops clamator.wav | Pseudoscops clamator | 0.002868 | 0.023882 | -5.854271 | 0.023601 | 5.058438 | 4.738787 | 6.69637 | 0.546537 | 51.582383 | 3.00000 | 1.00000 |
XC38073 - Búho negruzco - Asio stygius stygius.wav | Asio stygius | 0.001679 | 0.028895 | -6.389687 | 0.028486 | 2.765233 | 3.526204 | 4.78873 | 0.239533 | 0.239533 | 1.00000 | 1.00000 |
XC382357 - Mochuelo ecuatoriano - Glaucidium nubicola.wav | Glaucidium nubicola | 0.000506 | 0.011447 | -7.589116 | 0.011382 | 1.340145 | 1.334778 | 1.42705 | 0.140857 | 0.620512 | 2.50000 | 1.00000 |
XC382559 - Cárabo de las pagodas - Strix seloputo.wav | Strix seloputo | 0.010380 | 0.276206 | -4.567891 | 0.243892 | 0.507927 | 0.086352 | 4.02339 | 0.309037 | 1.125916 | 1.33333 | 1.00000 |
XC382952 - Mochuelo de El Cabo - Glaucidium capense.wav | Glaucidium capense | 1.521947 | 3.720173 | 0.419990 | 1.551845 | 1.070601 | 0.222394 | 2.10399 | 0.197119 | 26.746753 | 51.00000 | 1.00000 |
XC385223 - Autillo africano - Otus senegalensis.wav | Otus senegalensis | 0.000005 | 0.000018 | -12.265302 | 0.000018 | 1.155091 | 0.315623 | 10.08020 | 0.387820 | 37.114723 | 7.00000 | 1.00000 |
XC385234 - Mochuelo europeo - Athene noctua.wav | Athene noctua | 0.014646 | 0.535094 | -4.223611 | 0.428592 | 2.913595 | 1.255367 | 2.67652 | 0.092357 | 2.923017 | 2.33333 | 1.00000 |
XC385243 - Autillo europeo - Otus scops.wav | Otus scops | 0.158070 | 3.879879 | -1.844718 | 1.585120 | 1.309119 | 0.267669 | 1.94612 | 0.267603 | 1.865082 | 1.88889 | 1.66667 |
XC385245 - Autillo europeo - Otus scops.wav | Otus scops | 9.555606 | 19.635399 | 2.257128 | 3.027008 | 1.446859 | 1.624570 | 1.65625 | 0.120571 | 7.135541 | 5.80000 | 2.00000 |
XC391395 - Búho americano - Bubo virginianus nacurutu.wav | Bubo virginianus | 1.256166 | 38.046458 | 0.228064 | 3.664752 | 0.356855 | 0.805514 | 3.13085 | 0.479267 | 1.008516 | 1.75000 | 1.25000 |
XC391397 - Autillo chóliba - Megascops choliba.wav | Megascops choliba | 2.768321 | 17.126857 | 1.018241 | 2.897395 | 0.881240 | 0.931617 | 1.91326 | 0.049467 | 11.324964 | 29.00000 | 1.00000 |
XC391565 - Autillo bigotudo - Megascops trichopsis aspersus.wav | Megascops trichopsis | 7.682899 | 73.629061 | 2.038997 | 4.312530 | 0.923208 | 0.660938 | 3.35840 | 0.235684 | 11.500103 | 5.75000 | 1.37500 |
XC391608 - Cárabo chaqueño - Strix chacoensis.wav | Strix chacoensis | 1.293601 | 20.107990 | 0.257430 | 3.049652 | 0.680326 | 0.520261 | 9.61502 | 0.178244 | 1.035981 | 4.14286 | 1.14286 |
XC395177 - Autillo de Biak - Otus beccarii.wav | Otus beccarii | 0.095377 | 0.656671 | -2.349923 | 0.504810 | 0.825506 | 0.676511 | 12.00499 | 0.331558 | 1.761310 | 1.44444 | 1.00000 |
XC396497 - Autillo montano - Otus spilocephalus latouchi_Thailand1.wav | Otus spilocephalus | 0.000041 | 0.000968 | -10.093304 | 0.000968 | 1.513089 | 0.016527 | 1.00000 | 0.202233 | 0.816473 | 2.00000 | 1.00000 |
XC396730 - Autillo montano - Otus spilocephalus latouchi_Thailand2.wav | Otus spilocephalus | 0.021333 | 0.082725 | -3.847506 | 0.079481 | 1.426617 | 0.047112 | 1.51485 | 0.190893 | 0.937383 | 2.00000 | 1.00000 |
XC397258 - Autillo europeo - Otus scops.wav | Otus scops | 0.746101 | 0.157819 | -0.292895 | 0.146538 | 1.253673 | 0.125170 | 2.17918 | 0.279748 | 11.785985 | 5.00000 | 1.00000 |
XC397794 - Autillo yanqui - Megascops asio.wav | Megascops asio | 0.144394 | 0.110079 | -1.935212 | 0.104431 | 1.253673 | 0.604823 | 13.37012 | 1.092494 | 2.714727 | 1.75000 | 1.00000 |
XC398169 - Autillo africano - Otus senegalensis.wav | Otus senegalensis | 0.002951 | 0.030541 | -5.825712 | 0.030084 | 1.253673 | 0.129881 | 5.88053 | 0.241976 | 29.896549 | 7.00000 | 1.00000 |
XC399660 - Eastern Barn Owl - Tyto javanica.wav | Tyto javanica | 0.001102 | 0.035232 | -6.810222 | 0.034626 | 2.037931 | 6.037915 | 21.96403 | 0.947031 | 9.484098 | 7.00000 | 1.00000 |
XC400190 - Autillo africano - Otus senegalensis.wav | Otus senegalensis | 0.078777 | 1.065782 | -2.541134 | 0.725509 | 1.071987 | 0.448670 | 2.68744 | 0.302636 | 85.216397 | 10.00000 | 1.00000 |
XC400362 - Búho de Akún - Bubo leucostictus.wav | Bubo leucostictus | 0.463831 | 1.366226 | -0.768235 | 0.861296 | 1.247641 | 0.351850 | 33.12255 | 0.670088 | 1.588386 | 1.36364 | 1.00000 |
XC400440 - Mochuelo pechirrojo - Glaucidium tephronotum.wav | Glaucidium tephronotum | 13.614665 | 19.210711 | 2.611148 | 3.006213 | 1.234263 | 1.247601 | 2.52382 | 0.178929 | 2.303352 | 4.00000 | 1.25000 |
XC402959 - Mochuelo californiano - Glaucidium californicum.wav | Glaucidium californicum | 2.892511 | 2.700761 | 1.062125 | 1.308539 | 1.077141 | 0.115873 | 1.96384 | 0.214171 | 17.349382 | 6.33333 | 2.33333 |
XC403474 - Autillo de las Comoras - Otus pauliani.wav | Otus pauliani | 5.597192 | 4.547604 | 1.722265 | 1.713366 | 1.077874 | 0.121324 | 1.83348 | 0.112048 | 10.314911 | 23.50000 | 1.00000 |
XC403483 - Autillo de Moheli - Otus moheliensis.wav | Otus moheliensis | 0.017047 | 0.085409 | -4.071797 | 0.081956 | 1.318400 | 0.456638 | 9.47932 | 0.316087 | 0.739032 | 1.50000 | 1.00000 |
XC403494 - Autillo de Anjouan - Otus capnodes.wav | Otus capnodes | 2.078255 | 0.309510 | 0.731528 | 0.269653 | 1.818573 | 0.396804 | 2.90461 | 0.360635 | 1.313682 | 2.33333 | 1.33333 |
XC403495 - Autillo de Anjouan - Otus capnodes.wav | Otus capnodes | 5.648353 | 31.835757 | 1.731364 | 3.491518 | 1.831372 | 3.912082 | 3.84697 | 0.350455 | 1.254804 | 2.36364 | 1.27273 |
XC403513 - Autillo de la Mayotte - Otus mayottensis.wav | Otus mayottensis | 0.181001 | 2.268255 | -1.709250 | 1.184256 | 0.518662 | 0.068331 | 5.41959 | 0.323195 | 3.046705 | 5.33333 | 1.33333 |
XC403711 - Autillo de la Mantanani - Otus mantananensis.wav | Otus mantananensis | 0.014264 | 0.185520 | -4.250011 | 0.170181 | 0.786988 | 0.452429 | 5.02132 | 0.214054 | 0.214054 | 1.00000 | 1.00000 |
XC403972 - Autillo de Seychelles - Otus insularis.wav | Otus insularis | 0.008805 | 0.056009 | -4.732468 | 0.054497 | 0.629539 | 0.593440 | 13.63049 | 0.344471 | 5.437588 | 5.00000 | 1.00000 |
XC405190 - Autillo europeo - Otus scops.wav | Otus scops | 3.500625 | 0.624233 | 1.252941 | 0.485036 | 1.340145 | 0.305309 | 1.99841 | 0.287724 | 50.194837 | 20.00000 | 1.00000 |
XC407296 - Autillo europeo - Otus scops.wav | Otus scops | 2.390969 | 0.230599 | 0.871699 | 0.207501 | 1.340145 | 0.220784 | 1.99401 | 0.302473 | 24.310182 | 9.00000 | 1.00000 |
XC408591 - Autillo elegante - Otus elegans elegans.wav | Otus elegans | 0.582943 | 1.710315 | -0.539666 | 0.997065 | 0.896533 | 1.153242 | 2.91701 | 0.272948 | 17.399140 | 7.00000 | 3.00000 |
XC409856 - Lechuza tenebrosa - Tyto tenebricosa.wav | Tyto tenebricosa | 0.009551 | 0.110723 | -4.651151 | 0.105011 | 6.330639 | 3.614514 | 35.81059 | 1.615638 | 2.363271 | 1.33333 | 1.00000 |
XC409858 - Lechuza tenebrosa - Tyto tenebricosa.wav | Tyto tenebricosa | 0.000085 | 0.000387 | -9.368030 | 0.000386 | 2.398112 | 0.266725 | 20.98871 | 1.799848 | 4.786732 | 1.33333 | 1.33333 |
XC409889 - Nínox de Sumba chico - Ninox sumbaensis.wav | Ninox sumbaensis | 0.292558 | 3.713314 | -1.229094 | 1.550391 | 0.606018 | 0.722859 | 2.46615 | 0.353504 | 0.376394 | 1.04546 | 1.04546 |
XC409890 - Nínox de Sumba chico - Ninox sumbaensis.wav | Ninox sumbaensis | 0.013279 | 0.337192 | -4.321542 | 0.290572 | 0.727958 | 0.860101 | 2.80069 | 0.326685 | 0.326685 | 1.00000 | 1.00000 |
XC409946 - Mochuelo californiano - Glaucidium californicum californicum.wav | Glaucidium californicum | 3.237198 | 0.426919 | 1.174708 | 0.355518 | 1.241490 | 0.139971 | 3.19772 | 0.193558 | 4.223559 | 3.20000 | 1.00000 |
XC410403 - Autillo moluqueño - Otus magicus albiventris.wav | Otus magicus | 0.074894 | 0.788005 | -2.591684 | 0.581100 | 1.207131 | 0.841630 | 8.31398 | 0.325349 | 2.938065 | 1.61539 | 1.00000 |
XC410478 - Autillo de Wallace - Otus silvicola.wav | Otus silvicola | 0.665510 | 13.886802 | -0.407201 | 2.700475 | 0.475426 | 0.801957 | 5.10012 | 0.237768 | 8.625171 | 7.00000 | 1.00000 |
XC410514 - Autillo moluqueño - Otus magicus leucospilus.wav | Otus magicus | 0.192866 | 0.671192 | -1.645762 | 0.513537 | 0.867606 | 0.700079 | 15.18459 | 0.473478 | 0.581784 | 1.20000 | 1.00000 |
XC410664 - Lechuza de la Taliabu - Tyto nigrobrunnea.wav | Tyto nigrobrunnea | 0.178113 | 0.000000 | -1.725338 | 0.000000 | 1.858977 | 3.859721 | 16.77778 | 0.936584 | 0.936584 | 1.00000 | 1.00000 |
XC412303 - Autillo moluqueño - Otus magicus morotensis.wav | Otus magicus | 0.047033 | 0.466700 | -3.056896 | 0.383015 | 0.675056 | 0.394140 | 6.59101 | 0.233793 | 0.233793 | 1.00000 | 1.00000 |
XC412373 - Autillo piquigualdo - Otus icterorhynchus icterorhynchus.wav | Otus icterorhynchus | 0.000880 | 0.003619 | -7.035291 | 0.003612 | 1.340145 | 0.104182 | 10.99638 | 0.456556 | 29.634303 | 6.00000 | 1.00000 |
XC413068 - Autillo europeo - Otus scops.wav | Otus scops | 0.130437 | 1.727489 | -2.036864 | 1.003381 | 1.392756 | 0.847060 | 2.33155 | 0.298726 | 7.079038 | 3.75000 | 1.25000 |
XC413424 - Autillo de Koepcke - Megascops koepckeae.wav | Megascops koepckeae | 2.546324 | 18.683373 | 0.934651 | 2.979774 | 1.582744 | 1.468893 | 2.01296 | 0.101574 | 3.014551 | 15.50000 | 6.00000 |
XC413651 - Mochuelo de Java - Glaucidium castanopterum.wav | Glaucidium castanopterum | 0.575019 | 0.767293 | -0.553352 | 0.569449 | 1.163625 | 0.306093 | 3.49139 | 0.143732 | 6.303382 | 14.33333 | 1.00000 |
XC413898 - Autillo moluqueño - Otus magicus obira.wav | Otus magicus | 0.034216 | 0.700659 | -3.375056 | 0.531016 | 0.821314 | 0.432238 | 9.23236 | 0.327020 | 66.474691 | 8.00000 | 1.00000 |
XC413944 - Nínox ocráceo - Ninox ochracea.wav | Ninox ochracea | 0.776445 | 4.087502 | -0.253029 | 1.626787 | 0.837912 | 0.309577 | 9.82826 | 0.379764 | 0.831333 | 2.00000 | 1.00000 |
XC413948 - Autillo de Célebes - Otus manadensis.wav | Otus manadensis | 0.000652 | 0.001392 | -7.335512 | 0.001391 | 1.340145 | 0.137997 | 2.15473 | 0.446003 | 63.721847 | 8.00000 | 3.00000 |
XC413973 - Nínox punteado - Ninox punctulata.wav | Ninox punctulata | 0.133766 | 4.589835 | -2.011665 | 1.720950 | 1.000339 | 1.010999 | 3.61946 | 0.112461 | 27.067802 | 92.00000 | 1.00000 |
XC414032 - Mochuelo de Blewitt - Athene blewitti.wav | Athene blewitti | 10.291880 | 76.806030 | 2.331355 | 4.354219 | 1.131345 | 0.937794 | 1.76503 | 0.045580 | 19.889641 | 86.00000 | 1.00000 |
XC414991 - Lechuza de las Tanimbar - Tyto sororcula sororcula.wav | Tyto sororcula | 3.796223 | 5.687875 | 1.334007 | 1.900296 | 2.358844 | 3.930174 | 12.97855 | 0.176262 | 0.911981 | 4.60000 | 1.20000 |
XC415125 - Nínox ocráceo - Ninox ochracea.wav | Ninox ochracea | 1.261263 | 9.611252 | 0.232114 | 2.361915 | 0.670522 | 0.474672 | 16.87767 | 0.614978 | 0.815698 | 1.27273 | 1.00000 |
XC415126 - Lechuza de Minahassa - Tyto inexspectata.wav | Tyto inexspectata | 0.000604 | 0.004536 | -7.412374 | 0.004526 | 1.870215 | 0.696404 | 19.86059 | 0.591398 | 0.817789 | 1.20000 | 1.00000 |
XC416418 - Autillo europeo - Otus scops.wav | Otus scops | 0.004803 | 0.096721 | -5.338526 | 0.092325 | 1.294813 | 0.110952 | 1.66947 | 0.348401 | 10.867055 | 5.00000 | 1.00000 |
XC416703 - Autillo chino - Otus lettia.wav | Otus lettia | 0.000898 | 0.000010 | -7.014846 | 0.000010 | 0.994258 | 0.165984 | 2.45592 | 0.248476 | 18.566712 | 3.00000 | 1.00000 |
XC416832 - Autillo europeo - Otus scops.wav | Otus scops | 22.194379 | 2.222806 | 3.099839 | 1.170252 | 1.340145 | 0.282046 | 1.20592 | 0.262824 | 45.096040 | 17.00000 | 6.00000 |
XC417903 - Autillo moluqueño - Otus magicus magicus.wav | Otus magicus | 0.083709 | 0.490259 | -2.480412 | 0.398950 | 0.690470 | 0.213447 | 5.99353 | 0.156090 | 7.797766 | 18.00000 | 1.00000 |
XC417923 - Autillo de Pemba - Otus pembaensis.wav | Otus pembaensis | 1.026530 | 7.301259 | 0.026184 | 2.116407 | 0.766082 | 0.529441 | 3.76590 | 0.287386 | 0.307915 | 1.07143 | 1.07143 |
XC418222 - Lechuza malgache - Tyto soumagnei.wav | Tyto soumagnei | 0.000597 | 0.003335 | -7.423642 | 0.003329 | 1.447254 | 1.583217 | 25.33012 | 1.570359 | 17.829389 | 2.50000 | 1.00000 |
XC418808 - Autillo europeo - Otus scops.wav | Otus scops | 0.007389 | 0.381667 | -4.907712 | 0.323291 | 1.514303 | 0.426755 | 4.51561 | 0.265536 | 9.731823 | 4.33333 | 1.00000 |
XC418819 - Autillo europeo - Otus scops.wav | Otus scops | 0.002854 | 0.000000 | -5.859204 | 0.000000 | 1.340145 | 0.084343 | 9.54478 | 0.384968 | 0.384968 | 1.00000 | 1.00000 |
XC418862 - Autillo europeo - Otus scops.wav | Otus scops | 0.004956 | 0.094810 | -5.307206 | 0.090581 | 1.340145 | 0.035262 | 1.69849 | 0.266122 | 41.658806 | 18.00000 | 1.00000 |
XC418952 - Autillo malgache - Otus rutilus.wav | Otus rutilus | 0.517316 | 0.177613 | -0.659102 | 0.163490 | 0.907786 | 0.047488 | 2.43269 | 0.171447 | 1.683722 | 4.00000 | 1.00000 |
XC418993 - Autillo de Madagascar - Otus madagascariensis.wav | Otus madagascariensis | 0.008222 | 0.535676 | -4.800923 | 0.428971 | 1.253673 | 0.646861 | 4.94987 | 0.143424 | 2.281852 | 6.00000 | 1.50000 |
XC420110 - Mochuelo perlado - Glaucidium perlatum.wav | Glaucidium perlatum | 0.085900 | 0.507677 | -2.454569 | 0.410570 | 2.446069 | 1.501882 | 3.83929 | 0.460835 | 8.753469 | 9.33333 | 1.33333 |
XC420747 - Autillo europeo - Otus scops.wav | Otus scops | 0.009307 | 0.043601 | -4.677040 | 0.042678 | 1.303018 | 0.036170 | 1.74823 | 0.378773 | 42.608001 | 15.00000 | 1.00000 |
XC421498 - Lechuzón de anteojos - Pulsatrix perspicillata pulsatrix.wav | Pulsatrix perspicillata | 0.047628 | 0.903507 | -3.044325 | 0.643698 | 0.458132 | 0.203711 | 2.69497 | 0.077055 | 2.135751 | 13.00000 | 1.00000 |
XC421972 - Autillo europeo - Otus scops.wav | Otus scops | 2.414567 | 14.472630 | 0.881520 | 2.739073 | 1.482577 | 0.786537 | 2.17779 | 0.240454 | 8.389536 | 2.30000 | 1.40000 |
XC422271 - Mochuelo pechirrojo - Glaucidium tephronotum tephronotum.wav | Glaucidium tephronotum | 8.809806 | 3.695814 | 2.175865 | 1.546671 | 1.295566 | 0.233521 | 2.31636 | 0.136213 | 0.531151 | 2.00000 | 1.00000 |
XC42300 - Lechuza de las Tanimbar - Tyto sororcula cayelii_Buru (Moluccas).wav | Tyto sororcula | 0.000343 | 0.000000 | -7.977107 | 0.000000 | 2.075045 | 2.356076 | 42.40267 | 1.462882 | 1.462882 | 1.00000 | 1.00000 |
XC423087 - Autillo montano - Otus spilocephalus ss luciae.wav | Otus spilocephalus | 0.010302 | 0.192940 | -4.575435 | 0.176421 | 1.340145 | 0.029238 | 1.20683 | 0.176668 | 1.041368 | 2.00000 | 1.00000 |
XC423492 - Autillo malgache - Otus rutilus.wav | Otus rutilus | 2.141562 | 15.558906 | 0.761536 | 2.806924 | 1.121398 | 0.972275 | 3.87243 | 0.179500 | 3.135443 | 6.00000 | 1.66667 |
XC423721 - Mochuelo amazónico - Glaucidium hardyi.wav | Glaucidium hardyi | 1.683957 | 0.350814 | 0.521146 | 0.300707 | 1.290854 | 0.118560 | 1.13391 | 0.065932 | 21.816221 | 33.00000 | 1.00000 |
XC424514 - Búho nival - Bubo scandiacus.wav | Bubo scandiacus | 1.386306 | 15.071147 | 0.326643 | 2.777026 | 0.606959 | 0.222673 | 2.60232 | 0.206052 | 0.206052 | 1.00000 | 1.00000 |
XC424656 - Autillo africano - Otus senegalensis.wav | Otus senegalensis | 0.362334 | 1.297918 | -1.015188 | 0.832003 | 1.151818 | 0.338189 | 7.13061 | 0.235577 | 8.555582 | 3.20000 | 1.20000 |
XC426580 - Mochuelo acollarado - Glaucidium brodiei.wav | Glaucidium brodiei | 3.344252 | 4.577670 | 1.207243 | 1.718771 | 0.983851 | 0.383837 | 1.15536 | 0.093378 | 0.603625 | 2.05556 | 1.00000 |
XC427041 - Mochuelo canela - Aegolius harrisii.wav | Aegolius harrisii | 1.627190 | 1.323353 | 0.486855 | 0.843011 | 1.214178 | 0.298323 | 1.21629 | 0.040402 | 3.239875 | 52.00000 | 1.00000 |
XC427043 - Mochuelo canela - Aegolius harrisii.wav | Aegolius harrisii | 3.111926 | 2.362576 | 1.135242 | 1.212707 | 1.153338 | 0.262141 | 1.02989 | 0.031730 | 2.186448 | 31.00000 | 1.00000 |
XC427861 - Lechuzón acollarado chico - Pulsatrix koeniswaldiana.wav | Pulsatrix koeniswaldiana | 3.381412 | 18.216863 | 1.218293 | 2.955788 | 0.438936 | 0.459609 | 2.24993 | 0.038626 | 92.828794 | 51.00000 | 1.00000 |
XC428457 - Búho malayo - Bubo sumatranus.wav | Bubo sumatranus | 25.261683 | 27.054283 | 3.229289 | 3.334141 | 2.020451 | 6.000430 | 3.51075 | 0.299839 | 0.626652 | 1.66667 | 1.16667 |
XC428469 - Lechuza patilarga - Tyto longimembris_Australia.wav | Tyto longimembris_Australia | 0.000004 | 0.018624 | -12.448133 | 0.018452 | 2.318280 | 0.450956 | 1.14638 | 0.028374 | 10.009902 | 13.00000 | 1.00000 |
XC42972 - Cárabo pescador común - Scotopelia peli.wav | Scotopelia peli | 0.081872 | 0.864904 | -2.502599 | 0.623210 | 0.216010 | 0.077605 | 1.55330 | 0.279288 | 0.279288 | 1.00000 | 1.00000 |
XC429765 - Mochuelo de Pernambuco - Glaucidium mooreorum.wav | Glaucidium mooreorum | 0.004415 | 0.096881 | -5.422820 | 0.092471 | 1.341240 | 0.153052 | 3.44726 | 0.149312 | 1.432612 | 6.00000 | 1.00000 |
XC430284 - Autillo europeo - Otus scops.wav | Otus scops | 0.004435 | 0.026388 | -5.418230 | 0.026046 | 3.317530 | 2.273723 | 13.32248 | 0.416484 | 0.552640 | 1.11111 | 1.00000 |
XC432866 - Cárabo uralense - Strix uralensis.wav | Strix uralensis | 0.003515 | 0.064334 | -5.650690 | 0.062349 | 0.363645 | 0.088412 | 2.72358 | 0.092989 | 0.550442 | 2.50000 | 1.00000 |
XC432993 - Autillo de Mindoro - Otus mindorensis.wav | Otus mindorensis | 0.198086 | 3.109211 | -1.619055 | 1.413231 | 1.155387 | 0.186245 | 2.10617 | 0.333995 | 1.733789 | 2.33333 | 1.00000 |
XC433889 - Cárabo guatemalteco - Strix fulvescens.wav | Strix fulvescens | 1.631747 | 19.093650 | 0.489651 | 3.000404 | 0.664354 | 0.264278 | 3.67027 | 0.175089 | 1.295602 | 4.00000 | 3.00000 |
XC433965 - Nínox de Luzón - Ninox philippensis SS philippensis.wav | Ninox philippensis | 2.213066 | 9.313612 | 0.794379 | 2.333465 | 0.805309 | 0.385529 | 4.07430 | 0.208818 | 1.513686 | 2.00000 | 2.00000 |
XC434410 - Nínox australiano - Ninox boobook boobook.wav | Ninox boobook | 0.000607 | 0.012252 | -7.407646 | 0.012177 | 0.607860 | 0.100721 | 1.13063 | 0.209793 | 0.657763 | 2.00000 | 1.00000 |
XC434739 - Nínox australiano - Ninox boobook boobook.wav | Ninox boobook | 3.767811 | 35.929739 | 1.326494 | 3.609017 | 0.583981 | 0.138837 | 10.07871 | 0.361030 | 0.668359 | 1.60000 | 1.00000 |
XC438067 - Búho jamaicano - Pseudoscops grammicus.wav | Pseudoscops grammicus | 3.369062 | 3.279379 | 1.214634 | 1.453808 | 0.475426 | 0.130373 | 2.93090 | 0.251727 | 77.217503 | 6.00000 | 1.00000 |
XC442486 - Búho nepalí - Bubo nipalensis.wav | Bubo nipalensis | 1.175329 | 20.447057 | 0.161548 | 3.065587 | 0.542833 | 0.917902 | 3.90265 | 0.120624 | 8.808104 | 17.00000 | 4.00000 |
XC443370 - Mochuelo de madriguera - Athene cunicularia.wav | Athene cunicularia | 5.734036 | 21.721488 | 1.746420 | 3.123311 | 1.060263 | 0.819153 | 2.44757 | 0.346835 | 1.022017 | 2.00000 | 2.00000 |
XC443556 - Búho campestre - Asio flammeus.wav | Asio flammeus | 0.007042 | 0.107514 | -4.955862 | 0.102118 | 2.229758 | 1.059068 | 10.44111 | 0.642809 | 0.642809 | 1.00000 | 1.00000 |
XC444336 - Mochuelo perlado - Glaucidium perlatum.wav | Glaucidium perlatum | 0.000294 | 0.004813 | -8.130714 | 0.004801 | 2.065787 | 0.353414 | 1.58562 | 0.444381 | 29.491813 | 5.00000 | 2.00000 |
XC444338 - Búho lechoso - Bubo lacteus.wav | Bubo lacteus | 0.324834 | 8.370106 | -1.124442 | 2.237524 | 0.302482 | 0.138798 | 3.87289 | 0.108992 | 2.635558 | 8.33333 | 2.00000 |
XC444485 - Cárabo árabe - Strix hadorami.wav | Strix hadorami | 8.846953 | 6.068739 | 2.180073 | 1.955682 | 0.644629 | 0.094653 | 1.82177 | 0.139794 | 1.466548 | 5.00000 | 2.00000 |
XC44545 - Autillo persa - Otus brucei.wav | Otus brucei | 0.029929 | 0.151735 | -3.508942 | 0.141269 | 0.388954 | 0.125444 | 1.12384 | 0.090465 | 7.095402 | 10.66667 | 1.66667 |
XC447070 - Autillo orejudo de Mindanao - Otus everetti.wav | Otus everetti | 1.550938 | 5.815860 | 0.438860 | 1.919252 | 1.581540 | 1.040997 | 7.18267 | 0.321673 | 0.321673 | 1.00000 | 1.00000 |
XC447654 - Autillo cariblanco norteño - Ptilopsis leucotis.wav | Ptilopsis leucotis | 2.766568 | 0.247577 | 1.017607 | 0.221203 | 0.648370 | 0.578428 | 3.73114 | 0.300849 | 1.232487 | 2.00000 | 2.00000 |
XC448847 - Búho pescador de Ceilán - Ketupa zeylonensis.wav | Ketupa zeylonensis | 0.762541 | 7.071509 | -0.271099 | 2.088340 | 0.163990 | 0.070788 | 19.48651 | 0.231911 | 0.582907 | 2.16667 | 1.33333 |
XC45217 - Autillo de Peterson - Megascops petersoni.wav | Megascops petersoni | 0.372857 | 1.341026 | -0.986561 | 0.850589 | 0.645395 | 0.106164 | 1.45324 | 0.101852 | 6.038331 | 34.50000 | 3.00000 |
XC454909 - Búho desértico - Bubo ascalaphus.wav | Bubo ascalaphus | 0.000197 | 0.003343 | -8.529842 | 0.003338 | 0.475426 | 0.366692 | 7.38207 | 0.465510 | 0.465510 | 1.00000 | 1.00000 |
XC456728 - Mochuelo europeo - Athene noctua.wav | Athene noctua | 0.873109 | 9.316186 | -0.135695 | 2.333714 | 2.145507 | 2.717056 | 4.31677 | 0.476640 | 2.489157 | 2.33333 | 1.33333 |
XC456795 - Mochuelo de El Cabo - Glaucidium capense scheffleri.wav | Glaucidium capense | 1.361905 | 1.257536 | 0.308885 | 0.814274 | 0.959792 | 0.342854 | 6.89996 | 0.294758 | 2.372771 | 4.00000 | 1.00000 |
XC460758 - Cárabo ocelado - Strix ocellata.wav | Strix ocellata | 4.440411 | 20.110099 | 1.490747 | 3.049752 | 0.536017 | 0.132212 | 1.70854 | 0.112519 | 1.665931 | 5.50000 | 2.00000 |
XC46126 - Autillo cariblanco sureño - Ptilopsis granti.wav | Ptilopsis granti | 0.000041 | 0.000000 | -10.103048 | 0.000000 | 0.129538 | 0.149033 | 15.64163 | 0.767351 | 0.767351 | 1.00000 | 1.00000 |
XC467453 - Cárabo uralense - Strix uralensis.wav | Strix uralensis | 0.020240 | 0.720262 | -3.900096 | 0.542476 | 1.073645 | 2.336126 | 8.24007 | 0.186650 | 20.198168 | 21.00000 | 2.00000 |
XC468378 - Mochuelo alpino - Glaucidium passerinum.wav | Glaucidium passerinum | 22.129952 | 1.034178 | 3.096932 | 0.710092 | 1.456806 | 0.071673 | 4.13819 | 0.303931 | 9.367389 | 4.66667 | 2.66667 |
XC470445 - Cárabo oriental - Strix leptogrammica.wav | Strix leptogrammica | 10.976080 | 14.621934 | 2.395718 | 2.748676 | 0.374670 | 0.103699 | 4.25240 | 0.279748 | 1.377438 | 3.00000 | 3.00000 |
XC470587 - Cárabo árabe - Strix hadorami.wav | Strix hadorami | 0.062976 | 2.727956 | -2.765009 | 1.315860 | 0.579168 | 0.524348 | 3.78301 | 0.293302 | 0.541694 | 1.50000 | 1.00000 |
XC472591 - Búho de Coromandel - Bubo coromandus.wav | Bubo coromandus | 2.280990 | 48.271649 | 0.824610 | 3.897349 | 0.564383 | 0.324132 | 12.25809 | 0.219243 | 2.453242 | 6.00000 | 2.00000 |
XC473740 - Autillo de Pemba - Otus pembaensis.wav | Otus pembaensis | 0.011014 | 0.162226 | -4.508603 | 0.150337 | 0.670504 | 0.054726 | 3.13364 | 0.216593 | 9.430238 | 4.00000 | 1.00000 |
XC474679 - Búho campestre - Asio flammeus.wav | Asio flammeus | 0.008570 | 0.108237 | -4.759529 | 0.102770 | 0.366381 | 0.114851 | 1.52343 | 0.099077 | 2.033681 | 9.50000 | 1.00000 |
XC482486 - Nínox pardo - Ninox scutulata.wav | Ninox scutulata | 2.506176 | 0.000219 | 0.918758 | 0.000219 | 0.561898 | 0.044927 | 1.00000 | 0.151202 | 0.378052 | 2.00000 | 1.00000 |
XC487525 - Mochuelo brahmán - Athene brama.wav | Athene brama | 0.002780 | 0.005774 | -5.885233 | 0.005758 | 4.169808 | 1.679887 | 4.56053 | 0.307586 | 0.307586 | 1.00000 | 1.00000 |
XC492696 - Lechuza cornuda oriental - Phodilus badius badius.wav | Phodilus badius | 8.513801 | 6.138800 | 2.141688 | 1.965545 | 1.232654 | 0.448047 | 4.54190 | 0.446734 | 3.247057 | 5.50000 | 1.50000 |
XC494435 - Búho magallánico - Bubo magellanicus.wav | Bubo magellanicus | 2.490212 | 30.023360 | 0.912368 | 3.434740 | 0.351716 | 0.462484 | 2.92372 | 0.086429 | 0.853187 | 7.00000 | 3.00000 |
XC498062 - Mochuelo europeo - Athene noctua.wav | Athene noctua | 0.009209 | 0.000000 | -4.687627 | 0.000000 | 2.876051 | 1.201329 | 2.18031 | 0.194887 | 0.194887 | 1.00000 | 1.00000 |
XC498443 - Nínox pardo - Ninox scutulata scutulata.wav | Ninox scutulata | 0.001339 | 0.003005 | -6.615547 | 0.003001 | 0.648370 | 0.104359 | 3.27745 | 0.406342 | 0.406342 | 1.00000 | 1.00000 |
XC498645 - Cárabo norteamericano - Strix varia.wav | Strix varia | 1.131541 | 13.701731 | 0.123580 | 2.687965 | 0.469469 | 0.405449 | 4.45019 | 0.168636 | 2.502312 | 6.50000 | 3.00000 |
XC500060 - Búho gritón - Pseudoscops clamator.wav | Pseudoscops clamator | 0.027706 | 0.077853 | -3.586114 | 0.074971 | 2.827665 | 5.600515 | 7.20369 | 0.642049 | 0.642049 | 1.00000 | 1.00000 |
XC500332 - Autillo guatemalteco - Megascops guatemalae hastatus.wav | Megascops guatemalae | 0.008923 | 0.000000 | -4.719113 | 0.000000 | 0.734842 | 0.066406 | 14.28571 | 2.952092 | 2.952092 | 1.00000 | 1.00000 |
XC501320 - Autillo de la Simeulue - Otus umbra.wav | Otus umbra | 5.276854 | 15.276817 | 1.663330 | 2.789742 | 1.080729 | 0.173900 | 4.02797 | 0.177555 | 1.553552 | 3.83333 | 1.83333 |
XC501871 - Lechuza tenebrosa - Tyto tenebricosa arfaki.wav | Tyto tenebricosa | 0.003335 | 0.000000 | -5.703255 | 0.000000 | 2.167908 | 0.071931 | 15.50208 | 1.264781 | 1.264781 | 1.00000 | 1.00000 |
XC50244 - Búho gritón - Pseudoscops clamator.wav | Pseudoscops clamator | 0.023533 | 0.309708 | -3.749356 | 0.269805 | 3.293783 | 4.449599 | 11.90225 | 0.729447 | 0.729447 | 1.00000 | 1.00000 |
XC50245 - Mochuelo de madriguera - Athene cunicularia.wav | Athene cunicularia | 0.145731 | 2.727157 | -1.925996 | 1.315646 | 3.657025 | 1.886990 | 8.48625 | 0.273846 | 1.488200 | 4.00000 | 2.00000 |
XC502689 - Lechuza cornuda oriental - Phodilus badius badius.wav | Phodilus badius | 0.224359 | 0.596993 | -1.494509 | 0.468123 | 1.468316 | 0.289310 | 2.93462 | 0.331026 | 3.696839 | 7.00000 | 2.00000 |
XC505535 - Búho nepalí - Bubo nipalensis.wav | Bubo nipalensis | 0.000171 | 0.000000 | -8.671330 | 0.000000 | 1.858977 | 5.074615 | 9.68941 | 0.765223 | 0.765223 | 1.00000 | 1.00000 |
XC505805 - Autillo capirotado - Megascops atricapilla.wav | Megascops atricapilla | 4.448235 | 1.291230 | 1.492507 | 0.829089 | 0.821314 | 0.127564 | 1.00000 | 0.036646 | 14.175502 | 100.00000 | 1.00000 |
XC506423 - Mochuelo alpino - Glaucidium passerinum passerinum.wav | Glaucidium passerinum | 17.784921 | 0.450499 | 2.878351 | 0.371908 | 1.513089 | 0.552156 | 1.74332 | 0.265081 | 0.265081 | 1.00000 | 1.00000 |
XC509129 - Cárabo pescador vermiculado - Scotopelia bouvieri.wav | Scotopelia bouvieri | 3.117349 | 7.771499 | 1.136983 | 2.171508 | 0.388954 | 0.087171 | 2.42882 | 0.131958 | 0.932632 | 2.75000 | 1.00000 |
XC509183 - Mochuelo europeo - Athene noctua.wav | Athene noctua | 7.188703 | 18.334691 | 1.972511 | 2.961901 | 2.400704 | 2.714315 | 3.10563 | 0.111996 | 0.245918 | 1.75000 | 1.58333 |
XC509942 - Búho de Usambara - Bubo vosseleri.wav | Bubo vosseleri | 5.696272 | 4.811347 | 1.739812 | 1.759812 | 0.457239 | 0.167733 | 1.48509 | 0.056080 | 6.519603 | 58.00000 | 1.00000 |
XC509943 - Búho de Usambara - Bubo vosseleri.wav | Bubo vosseleri | 1.567074 | 3.597944 | 0.449210 | 1.525609 | 0.453450 | 0.182306 | 1.86598 | 0.054984 | 7.259985 | 61.00000 | 1.00000 |
XC511125 - Cárabo negro - Strix huhula.wav | Strix huhula | 1.274254 | 5.153430 | 0.242361 | 1.817010 | 0.474986 | 0.427257 | 5.88324 | 0.263183 | 0.556407 | 1.33333 | 1.33333 |
XC515232 - Cárabo africano - Strix woodfordii.wav | Strix woodfordii | 0.328688 | 4.329834 | -1.112645 | 1.673320 | 0.469748 | 0.092446 | 3.29725 | 0.126656 | 0.526452 | 2.50000 | 2.50000 |
XC516101 - Cárabo africano - Strix woodfordii.wav | Strix woodfordii | 3.000126 | 36.767681 | 1.098654 | 3.631454 | 0.597180 | 0.513831 | 4.80307 | 0.160274 | 1.215659 | 4.00000 | 1.40000 |
XC517658 - Autillo serrano - Megascops clarkii.wav | Megascops clarkii | 0.430441 | 4.195710 | -0.842945 | 1.647833 | 0.718393 | 0.195934 | 2.91809 | 0.253366 | 1.598642 | 4.00000 | 1.00000 |
XC520279 - Búho pescador malayo - Ketupa ketupu ketupu.wav | Ketupa ketupu | 0.037525 | 0.484943 | -3.282755 | 0.395377 | 1.599936 | 5.091545 | 16.55504 | 0.621768 | 0.779103 | 1.25000 | 1.25000 |
XC521631 - Mochuelo patagón - Glaucidium nana.wav | Glaucidium nana | 2.789030 | 1.326551 | 1.025694 | 0.844387 | 1.506352 | 0.247341 | 2.01057 | 0.077256 | 7.832529 | 26.00000 | 1.50000 |
XC521643 - Nínox ladrador - Ninox connivens.wav | Ninox connivens | 0.932016 | 1.170548 | -0.070405 | 0.774979 | 0.667252 | 0.139450 | 2.21457 | 0.181764 | 0.518466 | 2.00000 | 1.00000 |
XC522110 - Cárabo brasileño - Strix hylophila.wav | Strix hylophila | 3.746501 | 30.482164 | 1.320822 | 3.449421 | 0.487602 | 0.715938 | 4.58014 | 0.073081 | 31.996681 | 54.00000 | 1.00000 |
XC527720 - Mochuelo californiano - Glaucidium californicum californicum.wav | Glaucidium californicum | 0.000236 | 0.021256 | -8.353413 | 0.021033 | 1.167201 | 0.032237 | 1.80590 | 0.182451 | 0.182451 | 1.00000 | 1.00000 |
XC530747 - Autillo barbudo - Megascops barbarus.wav | Megascops barbarus | 100.000000 | 83.729629 | 4.605170 | 4.439465 | 0.930655 | 0.229518 | 1.20506 | 0.026321 | 6.496370 | 140.00000 | 3.00000 |
XC531731 - Cárabo pescador vermiculado - Scotopelia bouvieri.wav | Scotopelia bouvieri | 1.281172 | 5.179412 | 0.247775 | 1.821223 | 0.390592 | 0.163184 | 5.31196 | 0.240895 | 0.695908 | 1.83333 | 1.00000 |
XC536240 - Búho corniblanco - Lophostrix cristata cristata.wav | Lophostrix cristata | 0.136608 | 0.437529 | -1.990640 | 0.362926 | 0.475426 | 0.138926 | 10.92085 | 0.274860 | 0.274860 | 1.00000 | 1.00000 |
XC536954 - Búho malgache - Asio madagascariensis.wav | Asio madagascariensis | 4.982339 | 10.980996 | 1.605899 | 2.483322 | 1.151035 | 1.396084 | 2.68930 | 0.121960 | 0.121960 | 1.00000 | 1.00000 |
XC538622 - Cárabo café - Strix virgata.wav | Strix virgata | 0.161438 | 3.987617 | -1.823636 | 1.606958 | 0.559043 | 0.334629 | 3.04874 | 0.114482 | 3.950151 | 7.00000 | 1.00000 |
XC538623 - Mochuelo caburé - Glaucidium brasilianum.wav | Glaucidium brasilianum | 8.560558 | 1.653586 | 2.147165 | 0.975912 | 1.167201 | 0.099418 | 1.71898 | 0.119508 | 4.849842 | 13.00000 | 1.00000 |
XC53943 - Autillo elegante - Otus elegans calayensis.wav | Otus elegans | 0.000224 | 0.001827 | -8.402292 | 0.001826 | 0.784707 | 0.041047 | 1.29277 | 0.213040 | 1.015804 | 2.00000 | 2.00000 |
XC539680 - Nínox de las Togian - Ninox burhani.wav | Ninox burhani | 4.462257 | 52.109667 | 1.495655 | 3.972359 | 0.936032 | 3.463070 | 8.48160 | 0.140398 | 28.214770 | 19.00000 | 1.00000 |
XC53970 - Búho de Mindanao - Otus gurneyi.wav | Otus gurneyi | 0.914322 | 10.303377 | -0.089573 | 2.425102 | 1.377150 | 0.846080 | 8.64642 | 0.436557 | 0.436557 | 1.00000 | 1.00000 |
XC53972 - Autillo orejudo de Mindanao - Otus everetti.wav | Otus everetti | 0.018387 | 0.040041 | -3.996115 | 0.039261 | 1.020154 | 0.378778 | 3.64851 | 0.391546 | 0.391546 | 1.00000 | 1.00000 |
XC540479 - Búho chico - Asio otus.wav | Asio otus | 0.003297 | 0.009861 | -5.714682 | 0.009813 | 0.475426 | 4.935408 | 6.51500 | 0.463953 | 0.463953 | 1.00000 | 1.00000 |
XC543260 - Mochuelo alpino - Glaucidium passerinum.wav | Glaucidium passerinum | 9.249754 | 53.864229 | 2.224597 | 4.004862 | 1.384711 | 0.400994 | 1.03180 | 0.081901 | 1.069711 | 6.00000 | 2.00000 |
XC543296 - Mochuelo andino - Glaucidium jardinii.wav | Glaucidium jardinii | 1.566758 | 0.540090 | 0.449008 | 0.431841 | 1.425228 | 0.117759 | 1.41469 | 0.124168 | 20.090254 | 62.00000 | 1.00000 |
XC543582 - Búho de las Salomón - Nesasio solomonensis.wav | Nesasio solomonensis | 0.000100 | 0.000179 | -9.209878 | 0.000179 | 0.475426 | 0.086776 | 21.56301 | 1.330150 | 1.330150 | 1.00000 | 1.00000 |
XC543798 - Cárabo lapón - Strix nebulosa.wav | Strix nebulosa | 2.051400 | 6.840037 | 0.718522 | 2.059244 | 0.320674 | 0.354135 | 3.95653 | 0.185499 | 241.574266 | 20.00000 | 1.00000 |
XC548673 - Cárabo lapón - Strix nebulosa.wav | Strix nebulosa | 6.251964 | 3.000032 | 1.832896 | 1.386302 | 0.233470 | 0.226651 | 4.19237 | 0.173214 | 6.829467 | 13.00000 | 2.00000 |
XC549536 - Mochuelo mínimo - Glaucidium minutissimum.wav | Glaucidium minutissimum | 1.491181 | 0.624584 | 0.399568 | 0.485252 | 1.355831 | 0.076804 | 2.79535 | 0.270904 | 1.398604 | 3.00000 | 1.00000 |
XC551668 - Eastern Barn Owl - Tyto javanica.wav | Tyto javanica | 0.000672 | 0.000985 | -7.304544 | 0.000984 | 3.415596 | 5.021781 | 34.65830 | 0.896721 | 0.896721 | 1.00000 | 1.00000 |
XC552302 - Búho chico - Asio otus otus.wav | Asio otus | 0.003187 | 0.008494 | -5.748764 | 0.008458 | 0.388954 | 0.019935 | 1.97143 | 0.486486 | 0.486486 | 1.00000 | 1.00000 |
XC554145 - Mochuelo europeo - Athene noctua.wav | Athene noctua | 0.021786 | 0.221508 | -3.826484 | 0.200086 | 2.475828 | 3.910482 | 8.79406 | 0.461803 | 0.461803 | 1.00000 | 1.00000 |
XC554215 - Mochuelo de jungla - Glaucidium radiatum.wav | Glaucidium radiatum | 0.367437 | 5.731371 | -1.001202 | 1.906779 | 1.254905 | 0.316477 | 5.88094 | 0.219865 | 0.556542 | 1.75000 | 1.25000 |
XC556607 - Cárabo café - Strix virgata.wav | Strix virgata | 0.926594 | 17.974413 | -0.076240 | 2.943091 | 0.446689 | 0.345919 | 2.54431 | 0.156400 | 2.668762 | 8.00000 | 1.50000 |
XC557487 - Búho campestre - Asio flammeus.wav | Asio flammeus | 1.008640 | 0.471195 | 0.008603 | 0.386075 | 0.357725 | 0.459028 | 1.33433 | 0.080092 | 15.430641 | 28.00000 | 1.00000 |
XC558641 - Nínox halcón - Uroglaux dimorpha.wav | Uroglaux dimorpha | 1.764796 | 12.939867 | 0.568035 | 2.634753 | 0.388954 | 0.085256 | 6.12683 | 0.452144 | 1.155273 | 1.83333 | 1.00000 |
XC562106 - Autillo cariblanco norteño - Ptilopsis leucotis.wav | Ptilopsis leucotis | 0.401945 | 0.550779 | -0.911441 | 0.438757 | 0.475426 | 0.061380 | 8.05114 | 0.439892 | 0.557431 | 1.25000 | 1.00000 |
XC565795 - Mochuelo cabezón - Aegolius acadicus.wav | Aegolius acadicus | 0.407176 | 0.000000 | -0.898510 | 0.000000 | 1.253673 | 0.038534 | 2.00000 | 0.094501 | 0.446021 | 2.00000 | 1.00000 |
XC569898 - Búho americano - Bubo virginianus virginianus.wav | Bubo virginianus | 1.919816 | 19.923919 | 0.652229 | 3.040893 | 0.402635 | 0.343374 | 4.78895 | 0.195618 | 3.058104 | 8.00000 | 2.75000 |
XC578389 - Mochuelo de Java - Glaucidium castanopterum.wav | Glaucidium castanopterum | 1.919454 | 12.543299 | 0.652041 | 2.605892 | 1.040447 | 0.256961 | 6.37443 | 0.221305 | 3.154060 | 2.20000 | 1.00000 |
XC582134 - Mochuelo acollarado - Glaucidium brodiei.wav | Glaucidium brodiei | 3.680502 | 2.507640 | 1.303049 | 1.254944 | 0.994258 | 0.051105 | 1.20940 | 0.073711 | 1.338121 | 4.00000 | 1.00000 |
XC582487 - Nínox ladrador - Ninox connivens.wav | Ninox connivens | 3.093794 | 55.822818 | 1.129398 | 4.039938 | 0.952121 | 0.627225 | 2.90510 | 0.148682 | 0.846729 | 4.00000 | 2.33333 |
XC582539 - Mochuelo de jungla - Glaucidium radiatum.wav | Glaucidium radiatum | 0.017990 | 0.230157 | -4.017963 | 0.207142 | 1.235206 | 0.260160 | 6.49718 | 0.223023 | 2.366343 | 5.00000 | 1.50000 |
XC582865 - Mochuelo mínimo - Glaucidium minutissimum.wav | Glaucidium minutissimum | 12.544474 | 1.018200 | 2.529280 | 0.702206 | 1.426617 | 0.116800 | 1.71823 | 0.228063 | 1.168053 | 3.00000 | 1.00000 |
XC583813 - American Barn Owl - Tyto furcata.wav | Tyto furcata | 0.152677 | 0.052390 | -1.879428 | 0.051064 | 2.102982 | 5.663231 | 17.96842 | 1.092276 | 1.092276 | 1.00000 | 1.00000 |
XC583993 - Lechuza común - Tyto alba.wav | Tyto alba | 0.001145 | 0.003212 | -6.772012 | 0.003207 | 2.004994 | 4.007715 | 12.56062 | 0.832746 | 0.832746 | 1.00000 | 1.00000 |
XC588013 - Cárabo patiblanco - Strix albitarsis.wav | Strix albitarsis | 0.083596 | 2.369817 | -2.481761 | 1.214858 | 0.441397 | 0.119358 | 3.93362 | 0.245467 | 0.662122 | 1.40000 | 1.00000 |
XC589577 - Mochuelo caburé - Glaucidium brasilianum.wav | Glaucidium brasilianum | 5.463096 | 2.654260 | 1.698016 | 1.295894 | 1.281858 | 3.249745 | 1.82467 | 0.113559 | 24.369922 | 48.00000 | 1.00000 |
XC589811 - Cárabo patiblanco - Strix albitarsis.wav | Strix albitarsis | 0.016370 | 0.107204 | -4.112325 | 0.101838 | 0.693915 | 0.093887 | 5.24309 | 0.242572 | 0.242572 | 1.00000 | 1.00000 |
XC590316 - Nínox papú - Ninox theomacha.wav | Ninox theomacha | 0.000411 | 0.034788 | -7.796327 | 0.034197 | 0.797125 | 0.109766 | 4.71548 | 0.284853 | 0.748605 | 1.50000 | 1.00000 |
XC5915 - Mochuelo de Colima - Glaucidium palmarum.wav | Glaucidium palmarum | 6.069157 | 1.339625 | 1.803220 | 0.849991 | 1.513089 | 0.088354 | 1.74805 | 0.138758 | 1.094484 | 3.00000 | 1.00000 |
XC592306 - Búho campestre - Asio flammeus.wav | Asio flammeus | 2.963100 | 79.216945 | 1.086236 | 4.384735 | 0.719206 | 1.939756 | 2.25773 | 0.097210 | 1.679024 | 7.33333 | 1.66667 |
XC592818 - Lechuzón de anteojos - Pulsatrix perspicillata.wav | Pulsatrix perspicillata | 0.287117 | 5.989313 | -1.247866 | 1.944382 | 0.388111 | 0.243371 | 2.67287 | 0.056104 | 12.627781 | 38.00000 | 1.00000 |
XC603816 - Nínox ladrador - Ninox connivens peninsularis.wav | Ninox connivens | 0.127857 | 4.298969 | -2.056844 | 1.667512 | 0.781241 | 0.477508 | 3.81011 | 0.103322 | 0.578312 | 3.00000 | 1.00000 |
XC604887 - Búho americano - Bubo virginianus.wav | Bubo virginianus | 4.909964 | 76.392608 | 1.591267 | 4.348891 | 0.451292 | 3.452266 | 4.55515 | 0.336488 | 0.743744 | 1.88889 | 1.00000 |
XC607557 - Búho africano - Bubo africanus.wav | Bubo africanus | 0.095079 | 0.101175 | -2.353050 | 0.096377 | 0.434225 | 0.290010 | 3.13309 | 0.577904 | 1.598949 | 2.00000 | 2.00000 |
XC608659 - Nínox pardo - Ninox scutulata.wav | Ninox scutulata | 0.000290 | 0.010393 | -8.145525 | 0.010339 | 0.648370 | 0.179661 | 4.50049 | 0.502423 | 0.502423 | 1.00000 | 1.00000 |
XC609986 - Mochuelo de los saguaros - Micrathene whitneyi whitneyi.wav | Micrathene whitneyi | 0.080672 | 0.405796 | -2.517369 | 0.340604 | 1.702502 | 1.423732 | 15.33972 | 1.096120 | 1.096120 | 1.00000 | 1.00000 |
XC610478 - Nínox de Sumba grande - Ninox rudolfi.wav | Ninox rudolfi | 0.121687 | 3.585435 | -2.106302 | 1.522885 | 0.697198 | 0.336028 | 4.42440 | 0.147832 | 13.666480 | 45.00000 | 1.00000 |
XC610486 - Cárabo oriental - Strix leptogrammica.wav | Strix leptogrammica | 1.170719 | 12.508177 | 0.157618 | 2.603295 | 0.345551 | 0.320505 | 9.82001 | 0.217563 | 0.816454 | 3.00000 | 2.00000 |
XC613313 - Autillo chino - Otus lettia.wav | Otus lettia | 0.000343 | 0.000758 | -7.976408 | 0.000758 | 0.907786 | 0.102324 | 1.41292 | 0.270546 | 0.270546 | 1.00000 | 1.00000 |
XC613769 - Mochuelo de madriguera - Athene cunicularia.wav | Athene cunicularia | 6.913028 | 28.318576 | 1.933408 | 3.378221 | 0.958018 | 1.842902 | 3.51973 | 0.248164 | 0.609574 | 2.00000 | 2.00000 |
XC613906 - Cárabo ocelado - Strix ocellata.wav | Strix ocellata | 3.677444 | 5.903153 | 1.302218 | 1.931978 | 0.628281 | 0.106473 | 2.35007 | 0.188746 | 0.547445 | 2.50000 | 1.00000 |
XC613951 - Cárabo negro - Strix huhula.wav | Strix huhula | 0.986535 | 0.586660 | -0.013557 | 0.461631 | 0.390440 | 0.289425 | 3.87401 | 0.385705 | 0.883544 | 1.50000 | 1.50000 |
XC614413 - Búho real - Bubo bubo.wav | Bubo bubo | 0.000076 | 0.004112 | -9.484901 | 0.004103 | 0.475426 | 0.023932 | 1.92622 | 0.276201 | 0.276201 | 1.00000 | 1.00000 |
XC614535 - Mochuelo caburé - Glaucidium brasilianum.wav | Glaucidium brasilianum | 26.827685 | 3.882013 | 3.289434 | 1.585558 | 1.435071 | 0.295183 | 1.86625 | 0.074220 | 7.737451 | 21.50000 | 1.50000 |
XC61474 - Autillo californiano - Megascops kennicottii macfarlanei.wav | Megascops kennicottii | 1.120428 | 0.608958 | 0.113711 | 0.475587 | 0.714825 | 0.154799 | 1.28086 | 0.074227 | 1.535201 | 11.00000 | 2.00000 |
XC615644 - Mochuelo de El Cabo - Glaucidium capense ngamiense.wav | Glaucidium capense | 0.696472 | 0.211541 | -0.361727 | 0.191893 | 1.030481 | 0.161704 | 2.17493 | 0.239922 | 9.156943 | 17.00000 | 1.00000 |
XC616689 - Autillo de Mindanao - Otus mirus.wav | Otus mirus | 0.013574 | 0.013888 | -4.299577 | 0.013792 | 1.363317 | 0.063762 | 3.44181 | 0.458455 | 1.801467 | 2.00000 | 1.00000 |
XC618309 - Búho real - Bubo bubo.wav | Bubo bubo | 0.006896 | 0.040309 | -4.976874 | 0.039517 | 0.475426 | 0.024782 | 1.67078 | 0.321131 | 0.321131 | 1.00000 | 1.00000 |
XC619947 - Cárabo común - Strix aluco.wav | Strix aluco | 2.642435 | 0.500288 | 0.971701 | 0.405657 | 0.821314 | 0.084114 | 6.00654 | 0.691318 | 0.691318 | 1.00000 | 1.00000 |
XC620847 - Búho real - Bubo bubo.wav | Bubo bubo | 1.172603 | 8.765141 | 0.159226 | 2.278819 | 0.527344 | 0.382234 | 1.83052 | 0.242796 | 0.513310 | 2.00000 | 2.00000 |
XC620901 - Cárabo común - Strix aluco.wav | Strix aluco | 0.000257 | 0.007664 | -8.266627 | 0.007635 | 0.734842 | 0.055201 | 7.04259 | 1.012493 | 1.012493 | 1.00000 | 1.00000 |
XC620967 - Cárabo común - Strix aluco.wav | Strix aluco | 0.000397 | 0.002736 | -7.831950 | 0.002732 | 0.806614 | 0.090531 | 5.01453 | 0.993963 | 0.993963 | 1.00000 | 1.00000 |
XC623312 - Mochuelo boreal - Aegolius funereus.wav | Aegolius funereus | 0.251889 | 4.630951 | -1.378766 | 1.728278 | 0.879752 | 0.136973 | 1.71322 | 0.126317 | 2.483442 | 12.00000 | 1.00000 |
XC625748 - Mochuelo boreal - Aegolius funereus.wav | Aegolius funereus | 0.085562 | 0.146868 | -2.458512 | 0.137035 | 0.836280 | 0.130849 | 1.80769 | 0.090721 | 0.971511 | 6.50000 | 1.50000 |
XC625897 - Búho chico - Asio otus.wav | Asio otus | 0.001004 | 0.037627 | -6.904182 | 0.036936 | 0.388954 | 0.344820 | 1.20222 | 0.337001 | 0.337001 | 1.00000 | 1.00000 |
XC62899 - Mochuelo de Parker - Glaucidium parkeri.wav | Glaucidium parkeri | 6.231402 | 4.131233 | 1.829601 | 1.635346 | 1.298250 | 0.078376 | 1.99612 | 0.162542 | 41.167722 | 6.00000 | 1.00000 |
XC65746 - Mochuelo gnomo - Glaucidium gnoma.wav | Glaucidium gnoma | 0.391074 | 0.329889 | -0.938860 | 0.285095 | 1.076107 | 0.202315 | 1.58491 | 0.100171 | 2.789691 | 6.00000 | 1.00000 |
XC67492 - Autillo de Koepcke - Megascops koepckeae koepckeae.wav | Megascops koepckeae | 4.299868 | 35.729248 | 1.458584 | 3.603573 | 1.096960 | 1.082593 | 2.60188 | 0.083431 | 1.901361 | 14.00000 | 1.00000 |
XC68847 - Nínox de la Christmas - Ninox natalis.wav | Ninox natalis | 0.915623 | 7.941250 | -0.088150 | 2.190675 | 0.726625 | 0.268428 | 3.30442 | 0.139235 | 1.287781 | 4.00000 | 1.66667 |
XC68856 - Nínox de Luzón - Ninox philippensis centralis.wav | Ninox philippensis | 1.871432 | 3.896397 | 0.626704 | 1.588500 | 0.861106 | 0.293912 | 3.58555 | 0.160180 | 1.090562 | 2.66667 | 2.00000 |
XC69537 - Cárabo de Sichuán - Strix davidi.wav | Strix davidi | 0.073678 | 1.543578 | -2.608053 | 0.933572 | 0.411657 | 0.086755 | 6.29730 | 0.326345 | 0.697395 | 1.50000 | 1.00000 |
XC72493 - Mochuelo costarricense - Glaucidium costaricanum.wav | Glaucidium costaricanum | 1.688386 | 0.184370 | 0.523773 | 0.169211 | 1.160550 | 0.096410 | 2.19487 | 0.098281 | 5.416321 | 15.00000 | 1.00000 |
XC75956 - Autillo de Koepcke - Megascops koepckeae.wav | Megascops koepckeae | 11.346354 | 60.845222 | 2.428896 | 4.124635 | 1.435662 | 1.108285 | 2.19515 | 0.086041 | 1.772862 | 10.50000 | 2.50000 |
XC79257 - Búho filipino - Bubo philippensis.wav | Bubo philippensis | 4.136024 | 9.491221 | 1.419735 | 2.350539 | 1.263265 | 0.271408 | 6.31134 | 0.579243 | 0.827627 | 1.37500 | 1.00000 |
XC79288 - Autillo de la Mantanani - Otus mantananensis romblonis.wav | Otus mantananensis | 0.006053 | 0.087194 | -5.107222 | 0.083600 | 0.804440 | 0.255307 | 7.98714 | 0.212197 | 0.212197 | 1.00000 | 1.00000 |
XC80515 - Autillo californiano - Megascops kennicottii bendirei.wav | Megascops kennicottii | 0.029765 | 0.140976 | -3.514428 | 0.131884 | 0.648370 | 0.054920 | 1.07971 | 0.080253 | 1.357071 | 6.50000 | 1.00000 |
XC80580 - Autillo oriental - Otus sunia malayanus.wav | Otus sunia | 0.013382 | 0.329437 | -4.313828 | 0.284755 | 0.994258 | 0.256865 | 2.55237 | 0.130202 | 1.048382 | 3.00000 | 2.00000 |
XC82660 - Autillo africano - Otus senegalensis senegalensis.wav | Otus senegalensis | 0.015393 | 0.022330 | -4.173833 | 0.022084 | 1.080729 | 0.129017 | 4.29686 | 0.331813 | 0.331813 | 1.00000 | 1.00000 |
XC86593 - Autillo malgache - Otus rutilus rutilus.wav | Otus rutilus | 0.001058 | 0.011980 | -6.851726 | 0.011909 | 0.854610 | 0.038501 | 2.67816 | 0.119587 | 1.784192 | 5.50000 | 1.00000 |
XC88785 - Mochuelo peludo - Xenoglaux loweryi.wav | Xenoglaux loweryi | 0.006310 | 0.441782 | -5.065696 | 0.365880 | 0.808464 | 0.122219 | 13.03258 | 0.247947 | 0.247947 | 1.00000 | 1.00000 |
XC99672 - Mochuelo del Congo - Glaucidium sjostedti.wav | Glaucidium sjostedti | 0.010807 | 0.159175 | -4.527555 | 0.147708 | 0.781064 | 0.163871 | 6.14915 | 0.251752 | 4.756993 | 5.00000 | 1.00000 |
XC99674 - Mochuelo del Congo - Glaucidium sjostedti.wav | Glaucidium sjostedti | 0.027804 | 1.252805 | -3.582568 | 0.812176 | 0.785870 | 0.194108 | 6.64244 | 0.216723 | 5.613903 | 6.00000 | 1.00000 |
10 By species
Code
<- read.csv("./data/processed/owl_song_features_by_species.csv")
mean_sp_data
.print_df(mean_sp_data, height = "1000px")
species | umap.space.size | tsne.space.size | log.umap.space.size | log.tsne.space.size | peak.frequency | frequency.range | modulation | song.duration | num.elms | elm.types |
---|---|---|---|---|---|---|---|---|---|---|
Aegolius acadicus | 2.859842 | 1.204939 | 0.385777 | 0.613338 | 1.296909 | 0.058332 | 2.01030 | 24.756112 | 10.00000 | 1.00000 |
Aegolius funereus | 0.376088 | 8.853572 | -1.319143 | 1.463294 | 0.843249 | 0.149590 | 1.43151 | 1.496660 | 8.84211 | 1.15789 |
Aegolius harrisii | 2.369558 | 1.842965 | 0.811048 | 1.027859 | 1.183758 | 0.280232 | 1.12309 | 2.713161 | 41.50000 | 1.00000 |
Aegolius ridgwayi | 1.995173 | 5.387675 | 0.376486 | 1.775499 | 1.031027 | 0.285042 | 1.95192 | 11.280347 | 27.00000 | 1.25000 |
Asio capensis | 0.120642 | 2.064919 | -2.170162 | 1.071960 | 2.092058 | 3.336241 | 7.12012 | 0.525083 | 2.10000 | 1.30000 |
Asio flammeus | 0.996838 | 19.975973 | -2.155138 | 1.243925 | 0.918268 | 0.893176 | 3.88915 | 2.472568 | 7.30769 | 1.30769 |
Asio madagascariensis | 8.201163 | 29.979966 | 2.020632 | 3.197462 | 1.317898 | 1.431210 | 2.90265 | 0.142287 | 1.00000 | 1.00000 |
Asio otus | 0.002124 | 0.015154 | -6.460029 | 0.014961 | 0.452214 | 2.037752 | 2.80809 | 0.446922 | 1.00000 | 1.00000 |
Asio stygius | 0.004911 | 0.015168 | -5.600148 | 0.014963 | 3.101676 | 3.608676 | 4.54017 | 0.233106 | 1.00000 | 1.00000 |
Athene blewitti | 10.291880 | 76.806030 | 2.331355 | 4.354219 | 1.131345 | 0.937794 | 1.76503 | 19.889641 | 86.00000 | 1.00000 |
Athene brama | 0.007950 | 0.009973 | -5.109441 | 0.009915 | 3.595927 | 3.741462 | 7.02322 | 0.961420 | 2.50000 | 1.16667 |
Athene cunicularia | 3.369452 | 15.823296 | 0.555921 | 2.622596 | 1.485570 | 1.761601 | 5.12899 | 0.928907 | 2.33333 | 2.00000 |
Athene noctua | 1.355937 | 4.801591 | -2.411750 | 1.043707 | 2.768311 | 2.418267 | 3.82083 | 0.866140 | 1.89474 | 1.23684 |
Athene superciliaris | 0.005512 | 0.018479 | -7.514117 | 0.018146 | 0.749134 | 0.230186 | 3.06685 | 0.553852 | 1.00000 | 1.00000 |
Bubo africanus | 0.095079 | 0.101175 | -2.353050 | 0.096377 | 0.434225 | 0.290010 | 3.13309 | 1.598949 | 2.00000 | 2.00000 |
Bubo ascalaphus | 0.000197 | 0.003343 | -8.529842 | 0.003338 | 0.475426 | 0.366692 | 7.38207 | 0.465510 | 1.00000 | 1.00000 |
Bubo blakistoni | 0.119910 | 1.584731 | -2.152689 | 0.949612 | 0.251194 | 0.072063 | 4.82512 | 1.012923 | 3.71429 | 1.00000 |
Bubo bubo | 0.393191 | 2.936520 | -4.767516 | 0.774147 | 0.492732 | 0.143649 | 1.80917 | 0.333041 | 1.13636 | 1.13636 |
Bubo capensis | 3.341261 | 13.779503 | 1.206348 | 2.693241 | 0.464808 | 0.115776 | 2.36414 | 0.195512 | 1.00000 | 1.00000 |
Bubo cinerascens | 0.871614 | 1.750881 | -3.214019 | 0.752530 | 0.459870 | 0.322799 | 3.51254 | 1.172546 | 1.81818 | 1.54546 |
Bubo coromandus | 2.280990 | 48.271649 | 0.824610 | 3.897349 | 0.564383 | 0.324132 | 12.25809 | 2.453242 | 6.00000 | 2.00000 |
Bubo lacteus | 0.324834 | 8.370106 | -1.124442 | 2.237524 | 0.302482 | 0.138798 | 3.87289 | 2.635558 | 8.33333 | 2.00000 |
Bubo leucostictus | 0.266562 | 0.716957 | -1.718829 | 0.463396 | 1.219742 | 0.278269 | 19.92833 | 1.370129 | 1.28571 | 1.00000 |
Bubo magellanicus | 1.899629 | 21.939504 | 0.590833 | 3.066560 | 0.389768 | 0.420406 | 4.24150 | 0.674481 | 4.50000 | 2.50000 |
Bubo nipalensis | 0.392306 | 6.818278 | -5.022730 | 1.024445 | 1.180586 | 2.032761 | 5.86942 | 2.111887 | 3.46154 | 1.46154 |
Bubo philippensis | 4.136024 | 9.491221 | 1.419735 | 2.350539 | 1.263265 | 0.271408 | 6.31134 | 0.827627 | 1.37500 | 1.00000 |
Bubo poensis | 0.775924 | 1.911273 | -0.253700 | 1.068591 | 0.359510 | 0.262540 | 1.54027 | 0.509955 | 9.50000 | 1.00000 |
Bubo scandiacus | 0.652453 | 7.856281 | -1.656164 | 1.676025 | 0.544069 | 0.282330 | 4.13034 | 0.140715 | 1.02941 | 1.00000 |
Bubo sumatranus | 12.674630 | 13.531206 | 0.397033 | 1.671118 | 1.204702 | 3.023010 | 2.66587 | 0.863908 | 1.75000 | 1.37500 |
Bubo virginianus | 1.824905 | 27.746479 | 0.224852 | 2.651937 | 0.408441 | 1.071605 | 3.59868 | 1.539668 | 3.30000 | 1.73333 |
Bubo vosseleri | 3.631673 | 4.204646 | 1.094511 | 1.642711 | 0.455345 | 0.175019 | 1.67553 | 6.889794 | 59.50000 | 1.00000 |
Glaucidium bolivianum | 14.609915 | 8.049236 | 2.199687 | 1.710360 | 1.364649 | 1.270251 | 2.86029 | 0.487315 | 1.32075 | 1.05660 |
Glaucidium brasilianum | 13.617113 | 2.729953 | 2.378205 | 1.285788 | 1.294710 | 1.214782 | 1.80330 | 9.908901 | 23.40000 | 1.20000 |
Glaucidium brodiei | 2.349749 | 2.451182 | -0.399705 | 1.070447 | 0.990789 | 0.159680 | 1.15272 | 0.811907 | 2.54167 | 1.04167 |
Glaucidium californicum | 2.043315 | 1.049646 | -2.038860 | 0.561697 | 1.161944 | 0.096027 | 2.32249 | 3.441830 | 2.22727 | 1.18182 |
Glaucidium capense | 1.193441 | 1.729750 | 0.122383 | 0.852671 | 1.020291 | 0.242317 | 3.72629 | 8.696492 | 16.16667 | 1.00000 |
Glaucidium castanopterum | 1.247237 | 6.655296 | 0.049345 | 1.587670 | 1.102036 | 0.281527 | 4.93291 | 4.335055 | 6.75000 | 1.00000 |
Glaucidium castanotum | 2.713696 | 9.894555 | 0.786757 | 1.818995 | 0.973185 | 3.603230 | 4.19651 | 0.495188 | 1.61539 | 1.15385 |
Glaucidium costaricanum | 0.846950 | 0.128591 | -2.338437 | 0.119747 | 1.163875 | 0.097196 | 1.59744 | 0.255995 | 1.46667 | 1.00000 |
Glaucidium cuculoides | 1.505181 | 3.066475 | 0.408913 | 1.402777 | 0.994609 | 0.152137 | 1.13096 | 14.338630 | 184.00000 | 1.00000 |
Glaucidium gnoma | 0.973272 | 0.482406 | -0.248541 | 0.388345 | 1.119818 | 0.161116 | 1.65868 | 0.295727 | 1.33898 | 1.00000 |
Glaucidium griseiceps | 0.003591 | 0.103982 | -5.955778 | 0.095224 | 1.426617 | 0.042856 | 1.27384 | 2.650601 | 8.00000 | 1.66667 |
Glaucidium hardyi | 1.683957 | 0.350814 | 0.521146 | 0.300707 | 1.290854 | 0.118560 | 1.13391 | 21.816221 | 33.00000 | 1.00000 |
Glaucidium jardinii | 6.026566 | 16.214902 | 1.052614 | 1.546581 | 1.344992 | 0.710341 | 1.82520 | 1.879946 | 3.34043 | 1.06383 |
Glaucidium minutissimum | 7.017827 | 0.821392 | 1.464424 | 0.593729 | 1.391224 | 0.096802 | 2.25679 | 1.283328 | 3.00000 | 1.00000 |
Glaucidium mooreorum | 0.004415 | 0.096881 | -5.422820 | 0.092471 | 1.341240 | 0.153052 | 3.44726 | 1.432612 | 6.00000 | 1.00000 |
Glaucidium nana | 2.789030 | 1.326551 | 1.025694 | 0.844387 | 1.506352 | 0.247341 | 2.01057 | 7.832529 | 26.00000 | 1.50000 |
Glaucidium nubicola | 0.002251 | 0.140695 | -6.413185 | 0.118925 | 1.368969 | 0.500577 | 2.84989 | 0.196736 | 1.14815 | 1.03704 |
Glaucidium palmarum | 3.035206 | 0.713887 | -2.438484 | 0.467234 | 1.462823 | 0.094000 | 1.91101 | 1.896175 | 5.37500 | 1.00000 |
Glaucidium parkeri | 3.116596 | 2.113509 | -2.247891 | 0.863408 | 1.319198 | 0.059237 | 1.79354 | 8.591195 | 3.54546 | 1.00000 |
Glaucidium passerinum | 16.388209 | 18.449635 | 2.733293 | 1.695620 | 1.451536 | 0.341608 | 2.30443 | 3.477990 | 3.33333 | 1.77778 |
Glaucidium perlatum | 0.043097 | 0.256245 | -5.292641 | 0.207686 | 2.255928 | 0.927648 | 2.71245 | 13.938055 | 8.25000 | 1.50000 |
Glaucidium peruanum | 0.158240 | 2.501399 | -1.843645 | 1.253163 | 1.379543 | 0.389615 | 1.61566 | 14.043791 | 88.00000 | 1.00000 |
Glaucidium radiatum | 0.137646 | 2.215929 | -2.870781 | 0.878811 | 1.224188 | 0.262126 | 6.23614 | 0.406779 | 1.42424 | 1.09091 |
Glaucidium sanchezi | 0.002338 | 0.001983 | -6.058303 | 0.001981 | 1.472984 | 1.525044 | 4.08258 | 6.201964 | 4.00000 | 2.00000 |
Glaucidium siju | 0.023423 | 0.284218 | -3.754018 | 0.250150 | 3.318743 | 3.845932 | 2.88542 | 0.151975 | 1.00000 | 1.00000 |
Glaucidium sjostedti | 0.019306 | 0.705990 | -4.055062 | 0.479942 | 0.783467 | 0.178990 | 6.39580 | 5.185448 | 5.50000 | 1.00000 |
Glaucidium tephronotum | 7.474892 | 7.635638 | -1.234325 | 1.517758 | 1.261168 | 0.514816 | 3.86718 | 0.963243 | 2.00000 | 1.04762 |
Ketupa flavipes | 0.178622 | 0.447908 | -1.722486 | 0.370120 | 3.917214 | 1.972928 | 43.16510 | 1.519903 | 1.00000 | 1.00000 |
Ketupa ketupu | 0.037525 | 0.484943 | -3.282755 | 0.395377 | 1.599936 | 5.091545 | 16.55504 | 0.779103 | 1.25000 | 1.25000 |
Ketupa zeylonensis | 0.762541 | 7.071509 | -0.271099 | 2.088340 | 0.163990 | 0.070788 | 19.48651 | 0.582907 | 2.16667 | 1.33333 |
Lophostrix cristata | 0.089969 | 0.320043 | -2.564776 | 0.273688 | 0.475426 | 0.102566 | 9.39660 | 0.281235 | 1.00000 | 1.00000 |
Megascops albogularis | 1.840771 | 8.830124 | -0.491081 | 1.919945 | 0.735386 | 0.125586 | 1.51412 | 1.089879 | 8.00000 | 1.00000 |
Megascops asio | 2.424436 | 6.517932 | 0.127965 | 1.575462 | 1.009885 | 0.399528 | 8.69941 | 1.080294 | 3.19608 | 1.05882 |
Megascops atricapilla | 4.448235 | 1.291230 | 1.492507 | 0.829089 | 0.821314 | 0.127564 | 1.00000 | 14.175502 | 100.00000 | 1.00000 |
Megascops barbarus | 100.000000 | 83.729629 | 4.605170 | 4.439465 | 0.930655 | 0.229518 | 1.20506 | 6.496370 | 140.00000 | 3.00000 |
Megascops choliba | 1.958519 | 18.839079 | 0.631959 | 2.985732 | 0.723692 | 0.760388 | 1.94470 | 3.216960 | 15.60000 | 2.60000 |
Megascops clarkii | 1.122428 | 2.412621 | -0.123591 | 1.068063 | 0.725409 | 0.125413 | 2.42721 | 1.739832 | 4.25000 | 1.00000 |
Megascops colombianus | 0.060705 | 0.552074 | -2.801730 | 0.439592 | 0.886434 | 0.963319 | 1.73827 | 3.991732 | 18.50000 | 1.50000 |
Megascops cooperi | 0.188534 | 4.733413 | -1.668476 | 1.746311 | 0.525252 | 0.720345 | 2.35432 | 2.572361 | 23.00000 | 1.00000 |
Megascops guatemalae | 1.700620 | 3.969472 | -1.748800 | 1.095209 | 0.691606 | 0.101304 | 7.67932 | 6.833117 | 74.00000 | 1.00000 |
Megascops hoyi | 0.390270 | 10.050997 | -0.940916 | 2.402521 | 0.812346 | 0.933723 | 1.75390 | 37.860381 | 37.00000 | 1.00000 |
Megascops ingens | 0.522722 | 8.875042 | -0.702304 | 1.957774 | 0.909808 | 0.172554 | 4.15978 | 9.969991 | 36.62500 | 1.12500 |
Megascops kennicottii | 0.727026 | 7.319423 | -1.711238 | 1.019374 | 0.744704 | 1.307000 | 1.30617 | 2.715960 | 6.28571 | 1.14286 |
Megascops koepckeae | 6.064182 | 38.419281 | 1.607377 | 3.569327 | 1.371789 | 1.219924 | 2.27000 | 2.229591 | 13.33333 | 3.16667 |
Megascops marshalli | 1.509747 | 4.880979 | 0.411942 | 1.771723 | 0.668698 | 0.155776 | 1.13435 | 0.055772 | 1.00000 | 1.00000 |
Megascops nudipes | 14.732837 | 100.000000 | 2.690079 | 4.615121 | 0.654388 | 1.025208 | 1.55377 | 4.871391 | 60.00000 | 1.00000 |
Megascops petersoni | 2.780024 | 19.024221 | 0.329816 | 2.240223 | 0.649195 | 0.228427 | 3.60637 | 3.322355 | 17.50000 | 1.50000 |
Megascops roboratus | 0.726562 | 3.548704 | -0.319431 | 1.514842 | 0.631634 | 0.556545 | 1.01868 | 2.572310 | 69.00000 | 1.00000 |
Megascops sanctaecatarinae | 1.942468 | 24.534086 | 0.663959 | 3.240014 | 0.939440 | 0.329143 | 3.70593 | 4.641932 | 31.50000 | 2.00000 |
Megascops seductus | 0.182683 | 0.675229 | -1.700003 | 0.515950 | 0.695981 | 0.282010 | 2.22752 | 1.821760 | 8.00000 | 1.00000 |
Megascops trichopsis | 2.143304 | 20.725851 | -0.699112 | 2.014955 | 0.782742 | 0.256717 | 2.16312 | 8.084303 | 8.15385 | 1.69231 |
Megascops watsonii | 7.711608 | 12.110005 | 1.146056 | 2.310202 | 0.671814 | 0.192694 | 2.53974 | 0.335863 | 2.76923 | 1.01282 |
Micrathene whitneyi | 1.721235 | 2.714226 | -1.166935 | 0.855410 | 1.618589 | 1.482886 | 6.49030 | 1.719532 | 3.15385 | 1.41026 |
Nesasio solomonensis | 0.000100 | 0.000179 | -9.209878 | 0.000179 | 0.475426 | 0.086776 | 21.56301 | 1.330150 | 1.00000 | 1.00000 |
Ninox affinis | 0.014252 | 0.107387 | -5.365021 | 0.097938 | 0.932651 | 0.185324 | 10.88966 | 1.809801 | 1.46154 | 1.00000 |
Ninox boobook | 1.301250 | 12.348405 | -2.693726 | 1.454888 | 0.620905 | 0.120317 | 5.19914 | 0.382738 | 1.26316 | 1.00000 |
Ninox burhani | 4.462257 | 52.109667 | 1.495655 | 3.972359 | 0.936032 | 3.463070 | 8.48160 | 28.214770 | 19.00000 | 1.00000 |
Ninox connivens | 1.384556 | 20.430778 | -0.332617 | 2.160810 | 0.800205 | 0.414728 | 2.97659 | 0.676249 | 3.14286 | 1.57143 |
Ninox ios | 0.215099 | 4.513660 | -1.545361 | 1.688103 | 0.841723 | 0.457306 | 2.34011 | 0.192475 | 2.16000 | 1.72000 |
Ninox jacquinoti | 0.146400 | 0.779750 | -2.884278 | 0.478235 | 0.961637 | 0.453320 | 7.74790 | 0.618597 | 1.30233 | 1.06977 |
Ninox meeki | 0.072058 | 0.744396 | -2.630285 | 0.556408 | 0.505375 | 0.359521 | 6.83441 | 0.177734 | 1.35000 | 1.00000 |
Ninox natalis | 0.915623 | 7.941250 | -0.088150 | 2.190675 | 0.726625 | 0.268428 | 3.30442 | 1.287781 | 4.00000 | 1.66667 |
Ninox novaeseelandiae | 3.361954 | 0.424281 | -0.846066 | 0.322051 | 0.858004 | 0.345051 | 4.59780 | 0.526074 | 1.69231 | 1.69231 |
Ninox ochracea | 1.018854 | 6.849377 | -0.010458 | 1.994351 | 0.754217 | 0.392125 | 13.35296 | 0.819867 | 1.46667 | 1.00000 |
Ninox philippensis | 2.030711 | 9.700609 | 0.706013 | 2.249598 | 0.823001 | 0.349624 | 4.13125 | 1.271983 | 2.36364 | 1.90909 |
Ninox punctulata | 4.105432 | 3.160113 | 0.530571 | 1.390241 | 1.508501 | 2.470162 | 4.10821 | 1.015139 | 4.02000 | 1.12000 |
Ninox rudolfi | 0.117452 | 3.297863 | -2.142379 | 1.455874 | 0.486510 | 0.368601 | 3.47590 | 0.410254 | 2.15789 | 1.00000 |
Ninox rufa | 3.711317 | 3.053315 | 1.311387 | 1.399535 | 0.388954 | 0.032172 | 1.09596 | 1.028087 | 2.50000 | 1.25000 |
Ninox scutulata | 0.835935 | 0.004539 | -4.614105 | 0.004520 | 0.619546 | 0.109649 | 2.92598 | 0.457884 | 1.08000 | 1.00000 |
Ninox squamipila | 0.545116 | 3.352745 | -0.828673 | 1.470372 | 0.287228 | 0.458355 | 2.53411 | 0.248381 | 1.93548 | 1.03226 |
Ninox strenua | 1.211521 | 10.873029 | -1.163577 | 2.213983 | 0.353596 | 0.331739 | 8.79797 | 0.952834 | 1.65574 | 1.42623 |
Ninox sumbaensis | 0.779772 | 5.326349 | -1.613629 | 1.466800 | 0.732514 | 0.644868 | 2.81851 | 0.369245 | 1.06452 | 1.06452 |
Ninox theomacha | 0.039457 | 0.167113 | -5.170480 | 0.148064 | 0.807630 | 0.123836 | 4.33373 | 1.165502 | 1.86667 | 1.60000 |
Otus alfredi | 5.850301 | 0.216039 | 1.766493 | 0.195599 | 1.241033 | 0.810919 | 1.00000 | 1.202995 | 12.00000 | 1.00000 |
Otus alius | 0.014398 | 0.128985 | -4.240691 | 0.121319 | 2.082913 | 0.493455 | 4.09202 | 0.461646 | 1.00000 | 1.00000 |
Otus angelinae | 0.221413 | 0.454373 | -2.134328 | 0.360053 | 4.146367 | 4.745470 | 10.98986 | 1.218506 | 1.71429 | 1.42857 |
Otus bakkamoena | 0.027973 | 0.184809 | -3.579341 | 0.168835 | 1.122049 | 0.615477 | 3.17183 | 4.952583 | 2.63636 | 1.00000 |
Otus balli | 0.238431 | 1.134396 | -1.433674 | 0.758184 | 0.608674 | 0.710617 | 2.44035 | 4.636761 | 6.16667 | 1.16667 |
Otus beccarii | 0.095377 | 0.656671 | -2.349923 | 0.504810 | 0.825506 | 0.676511 | 12.00499 | 1.761310 | 1.44444 | 1.00000 |
Otus brookii | 0.098533 | 0.091403 | -2.317362 | 0.087464 | 0.997524 | 0.590876 | 7.65247 | 0.223993 | 1.00000 | 1.00000 |
Otus brucei | 0.090749 | 0.629589 | -2.697824 | 0.443372 | 0.449535 | 0.340864 | 1.62030 | 16.659932 | 18.16667 | 2.33333 |
Otus capnodes | 3.863304 | 16.072634 | 1.231446 | 1.880586 | 1.824973 | 2.154443 | 3.37579 | 1.267420 | 2.35714 | 1.28571 |
Otus collari | 4.382448 | 4.301202 | 1.477608 | 1.667934 | 1.772505 | 0.040956 | 3.27396 | 21.525873 | 2.50000 | 1.00000 |
Otus elegans | 1.120802 | 2.281718 | -3.456774 | 0.788828 | 0.823414 | 0.345539 | 2.62555 | 2.854621 | 2.70000 | 1.90000 |
Otus enganensis | 0.154785 | 0.691173 | -1.865715 | 0.525422 | 0.546350 | 0.291705 | 10.23381 | 1.018167 | 1.66667 | 1.00000 |
Otus everetti | 0.784662 | 2.927951 | -1.778628 | 0.979256 | 1.300847 | 0.709888 | 5.41559 | 0.344964 | 1.00000 | 1.00000 |
Otus fuliginosus | 0.004500 | 0.005143 | -5.403621 | 0.005130 | 0.994258 | 0.727259 | 18.01121 | 0.876024 | 1.00000 | 1.00000 |
Otus gurneyi | 0.471416 | 5.342915 | -1.823527 | 1.374481 | 1.037092 | 0.775860 | 8.98659 | 0.446923 | 1.00000 | 1.00000 |
Otus hartlaubi | 0.005344 | 0.006592 | -5.231755 | 0.006570 | 1.482866 | 0.131996 | 3.78277 | 0.367079 | 1.00000 | 1.00000 |
Otus icterorhynchus | 0.000880 | 0.003619 | -7.035291 | 0.003612 | 1.340145 | 0.104182 | 10.99638 | 29.634303 | 6.00000 | 1.00000 |
Otus insularis | 0.008805 | 0.056009 | -4.732468 | 0.054497 | 0.629539 | 0.593440 | 13.63049 | 5.437588 | 5.00000 | 1.00000 |
Otus ireneae | 0.004144 | 0.095459 | -5.485987 | 0.091173 | 0.994258 | 2.030535 | 2.83394 | 11.640900 | 20.00000 | 1.00000 |
Otus lempiji | 0.122392 | 0.353950 | -2.100526 | 0.303026 | 0.907786 | 0.225978 | 4.37670 | 0.280678 | 1.00000 | 1.00000 |
Otus lettia | 0.000489 | 0.000995 | -7.796351 | 0.000994 | 0.878962 | 0.127342 | 2.18859 | 1.689414 | 1.15385 | 1.00000 |
Otus longicornis | 0.002310 | 0.057480 | -6.976082 | 0.054474 | 1.123965 | 0.055375 | 2.45540 | 6.488678 | 3.00000 | 1.75000 |
Otus madagascariensis | 0.005802 | 0.350808 | -5.245148 | 0.291249 | 1.204185 | 0.582255 | 3.54401 | 2.257422 | 6.00000 | 1.25000 |
Otus magicus | 0.083333 | 0.616990 | -2.641451 | 0.478047 | 0.911680 | 0.514806 | 8.21910 | 4.247885 | 2.53333 | 1.00000 |
Otus manadensis | 0.000652 | 0.001392 | -7.335512 | 0.001391 | 1.340145 | 0.137997 | 2.15473 | 63.721847 | 8.00000 | 3.00000 |
Otus mantananensis | 0.010158 | 0.136357 | -4.678616 | 0.126891 | 0.795714 | 0.353868 | 6.50423 | 0.212962 | 1.00000 | 1.00000 |
Otus mayottensis | 0.181001 | 2.268255 | -1.709250 | 1.184256 | 0.518662 | 0.068331 | 5.41959 | 3.046705 | 5.33333 | 1.33333 |
Otus megalotis | 2.340469 | 41.025645 | 0.850351 | 3.738280 | 0.966300 | 0.461867 | 5.20054 | 4.706466 | 4.00000 | 2.00000 |
Otus mentawi | 0.001946 | 0.026534 | -6.242050 | 0.026188 | 0.967677 | 0.539999 | 8.28251 | 0.226439 | 1.00000 | 1.00000 |
Otus mindorensis | 0.198086 | 3.109211 | -1.619055 | 1.413231 | 1.155387 | 0.186245 | 2.10617 | 1.733789 | 2.33333 | 1.00000 |
Otus mirus | 0.066465 | 0.008302 | -3.212610 | 0.008252 | 1.351731 | 0.038159 | 2.83829 | 1.621110 | 2.00000 | 1.50000 |
Otus moheliensis | 0.034441 | 0.042704 | -3.515747 | 0.040978 | 1.581771 | 1.674242 | 7.56525 | 0.541032 | 1.33333 | 1.00000 |
Otus pauliani | 5.597192 | 4.547604 | 1.722265 | 1.713366 | 1.077874 | 0.121324 | 1.83348 | 10.314911 | 23.50000 | 1.00000 |
Otus pembaensis | 0.518772 | 3.731743 | -2.241209 | 1.133372 | 0.718293 | 0.292084 | 3.44977 | 1.448205 | 1.43750 | 1.06250 |
Otus rufescens | 1.237427 | 1.331825 | -4.988171 | 0.649230 | 0.854903 | 0.261932 | 4.01953 | 6.733690 | 4.33333 | 1.33333 |
Otus rutilus | 0.886645 | 5.249500 | -2.249764 | 0.994108 | 0.961264 | 0.352754 | 2.99443 | 2.334594 | 5.28571 | 1.28571 |
Otus sagittatus | 12.515753 | 4.992899 | 2.526988 | 1.790575 | 0.384884 | 0.160574 | 1.13446 | 0.042939 | 1.00000 | 1.00000 |
Otus scops | 3.401799 | 2.451453 | -2.581949 | 0.631449 | 1.462938 | 0.433083 | 3.02364 | 6.511479 | 3.25676 | 1.28378 |
Otus semitorques | 0.349898 | 0.361813 | -1.050114 | 0.308817 | 0.216010 | 0.091757 | 1.04376 | 21.145991 | 31.50000 | 1.00000 |
Otus senegalensis | 0.067592 | 0.423866 | -5.321338 | 0.293167 | 1.137319 | 0.235628 | 6.46435 | 6.983983 | 2.22857 | 1.05714 |
Otus silvicola | 0.266557 | 4.772977 | -2.085976 | 1.028519 | 0.730583 | 0.481493 | 5.50626 | 0.635059 | 1.33333 | 1.00000 |
Otus spilocephalus | 1.812022 | 0.134349 | -3.674010 | 0.116582 | 1.474043 | 0.039421 | 1.62319 | 1.672806 | 2.09524 | 1.26191 |
Otus spilocephalus_Cambodia | 0.064011 | 0.481554 | -2.748694 | 0.393091 | 1.517441 | 0.101094 | 2.69805 | 0.273946 | 1.00000 | 1.00000 |
Otus spilocephalus_Malaysia_Borneo | 0.000266 | 0.000639 | -8.233409 | 0.000639 | 1.340145 | 0.046274 | 1.33093 | 1.175166 | 2.00000 | 1.00000 |
Otus spilocephalus_Vietnam | 0.051936 | 0.366890 | -2.957751 | 0.312538 | 1.621813 | 0.291693 | 1.11199 | 0.979404 | 2.66667 | 1.66667 |
Otus sunia | 0.600768 | 3.748417 | -2.600272 | 1.049632 | 0.945937 | 0.283433 | 3.16188 | 1.178904 | 3.15789 | 2.22368 |
Otus thilohoffmanni | 0.000331 | 0.000541 | -8.014660 | 0.000541 | 0.734842 | 0.129472 | 2.06928 | 0.259252 | 1.00000 | 1.00000 |
Otus umbra | 9.452008 | 8.743465 | 2.137698 | 1.978024 | 1.889796 | 1.004929 | 6.37784 | 0.751884 | 2.06250 | 1.31250 |
Phodilus assimilis | 0.298685 | 0.933551 | -1.208366 | 0.659358 | 1.381487 | 0.576004 | 8.08853 | 5.422994 | 4.00000 | 3.00000 |
Phodilus badius | 3.166912 | 2.483913 | 0.125376 | 0.991211 | 1.374675 | 0.393067 | 4.23211 | 1.788331 | 3.50000 | 1.40000 |
Pseudoscops clamator | 0.018035 | 0.137148 | -4.396581 | 0.122792 | 3.726628 | 4.929634 | 8.60077 | 5.312715 | 1.18182 | 1.00000 |
Pseudoscops grammicus | 3.369062 | 3.279379 | 1.214634 | 1.453808 | 0.475426 | 0.130373 | 2.93090 | 77.217503 | 6.00000 | 1.00000 |
Psiloscops flammeolus | 0.765308 | 0.652069 | -1.991029 | 0.419120 | 0.509137 | 0.042400 | 2.44885 | 0.400855 | 1.37500 | 1.25000 |
Ptilopsis granti | 0.000041 | 0.000000 | -10.103048 | 0.000000 | 0.129538 | 0.149033 | 15.64163 | 0.767351 | 1.00000 | 1.00000 |
Ptilopsis leucotis | 1.584256 | 0.399178 | 0.053083 | 0.329980 | 0.561898 | 0.319904 | 5.89114 | 0.782450 | 1.50000 | 1.33333 |
Pulsatrix koeniswaldiana | 3.381412 | 18.216863 | 1.218293 | 2.955788 | 0.438936 | 0.459609 | 2.24993 | 92.828794 | 51.00000 | 1.00000 |
Pulsatrix melanota | 2.874262 | 15.660409 | 1.055796 | 2.813035 | 0.659063 | 0.334319 | 1.30147 | 0.067688 | 1.84211 | 1.68421 |
Pulsatrix perspicillata | 0.167373 | 3.446410 | -2.146096 | 1.294040 | 0.423121 | 0.223541 | 2.68392 | 5.633094 | 21.33333 | 1.00000 |
Pyrroglaux podargina | 2.094540 | 58.461021 | 0.739334 | 4.085321 | 0.766749 | 0.959448 | 2.85104 | 0.812247 | 1.07534 | 1.02740 |
Scotopelia bouvieri | 2.199261 | 6.475455 | 0.692379 | 1.996365 | 0.389773 | 0.125178 | 3.87039 | 0.790598 | 2.20000 | 1.00000 |
Scotopelia peli | 0.081872 | 0.864904 | -2.502599 | 0.623210 | 0.216010 | 0.077605 | 1.55330 | 0.279288 | 1.00000 | 1.00000 |
Scotopelia ussheri | 0.035547 | 1.326009 | -3.367177 | 0.647640 | 0.302482 | 0.286475 | 4.45195 | 0.376357 | 1.00000 | 1.00000 |
Strix albitarsis | 0.049983 | 1.238511 | -3.297043 | 0.658348 | 0.567656 | 0.106622 | 4.58836 | 0.403937 | 1.15385 | 1.00000 |
Strix aluco | 0.881029 | 0.170229 | -5.042292 | 0.138675 | 0.787590 | 0.076616 | 6.02122 | 0.922934 | 1.00000 | 1.00000 |
Strix chacoensis | 1.816602 | 29.502897 | 0.553705 | 3.367986 | 0.654447 | 0.573935 | 8.46539 | 0.599576 | 2.90909 | 1.13636 |
Strix davidi | 0.073678 | 1.543578 | -2.608053 | 0.933572 | 0.411657 | 0.086755 | 6.29730 | 0.697395 | 1.50000 | 1.00000 |
Strix fulvescens | 1.627269 | 10.618016 | 0.486899 | 2.072693 | 0.699598 | 0.265967 | 3.50979 | 1.566787 | 4.40000 | 3.00000 |
Strix hadorami | 4.454964 | 4.398347 | -0.292468 | 1.635771 | 0.611898 | 0.309501 | 2.80239 | 0.849979 | 2.66667 | 1.33333 |
Strix huhula | 1.130394 | 2.870045 | 0.114402 | 1.139320 | 0.432713 | 0.358341 | 4.87863 | 0.687262 | 1.40000 | 1.40000 |
Strix hylophila | 3.746501 | 30.482164 | 1.320822 | 3.449421 | 0.487602 | 0.715938 | 4.58014 | 31.996681 | 54.00000 | 1.00000 |
Strix leptogrammica | 4.057950 | 9.082920 | -0.352227 | 1.821364 | 0.773979 | 1.731223 | 8.05035 | 1.228619 | 2.25000 | 1.87500 |
Strix nebulosa | 4.151682 | 4.920034 | 1.275709 | 1.722773 | 0.277072 | 0.290393 | 4.07445 | 124.201866 | 16.50000 | 1.50000 |
Strix nigrolineata | 0.726985 | 9.302542 | -0.329107 | 2.332293 | 0.619636 | 0.554354 | 3.52741 | 0.275660 | 1.62500 | 1.37500 |
Strix ocellata | 4.058927 | 13.006626 | 1.396482 | 2.490865 | 0.582149 | 0.119343 | 2.02931 | 1.106688 | 4.00000 | 1.50000 |
Strix rufipes | 1.738389 | 17.423030 | 0.552959 | 2.913602 | 0.563782 | 1.340995 | 2.85620 | 0.089170 | 1.08000 | 1.00000 |
Strix seloputo | 0.325792 | 9.455719 | -2.506149 | 1.610609 | 0.506623 | 0.216869 | 8.58354 | 0.775265 | 1.23077 | 1.00000 |
Strix uralensis | 0.011878 | 0.392298 | -4.775393 | 0.302413 | 0.718645 | 1.212269 | 5.48183 | 4.479987 | 6.20000 | 1.20000 |
Strix varia | 2.118273 | 14.628444 | 0.628298 | 2.747331 | 0.530971 | 0.511143 | 4.31625 | 2.685673 | 7.25000 | 2.50000 |
Strix virgata | 0.544016 | 10.981015 | -0.949938 | 2.275025 | 0.502866 | 0.340274 | 2.79653 | 3.309457 | 7.50000 | 1.25000 |
Strix woodfordii | 1.664407 | 20.548757 | -0.006995 | 2.652387 | 0.533464 | 0.303139 | 4.05016 | 0.909345 | 3.33333 | 1.88889 |
Surnia ulula | 3.845855 | 37.161243 | 1.346996 | 3.641820 | 0.873611 | 2.061844 | 1.10287 | 6.886741 | 86.00000 | 1.00000 |
Tyto alba | 0.001145 | 0.003212 | -6.772012 | 0.003207 | 2.004994 | 4.007715 | 12.56062 | 0.832746 | 1.00000 | 1.00000 |
Tyto furcata | 0.076644 | 0.026296 | -4.640678 | 0.025633 | 2.418000 | 3.288136 | 23.70633 | 0.938827 | 1.00000 | 1.00000 |
Tyto glaucops | 0.815766 | 3.709118 | -0.203628 | 1.549501 | 2.073895 | 5.596116 | 34.01387 | 1.172658 | 1.11111 | 1.11111 |
Tyto inexspectata | 0.013250 | 0.043480 | -5.533018 | 0.041864 | 1.866059 | 2.072590 | 13.56838 | 1.215628 | 1.55556 | 1.00000 |
Tyto javanica | 0.000887 | 0.018108 | -7.057383 | 0.017805 | 2.726764 | 5.529848 | 28.31117 | 3.043566 | 2.50000 | 1.00000 |
Tyto longimembris_Australia | 0.000004 | 0.018624 | -12.448133 | 0.018452 | 2.318280 | 0.450956 | 1.14638 | 10.009902 | 13.00000 | 1.00000 |
Tyto multipunctata | 0.001048 | 0.010374 | -6.861005 | 0.010321 | 2.490574 | 3.222532 | 45.27742 | 2.086998 | 1.00000 | 1.00000 |
Tyto nigrobrunnea | 0.178113 | 0.000000 | -1.725338 | 0.000000 | 1.858977 | 3.859721 | 16.77778 | 0.936584 | 1.00000 | 1.00000 |
Tyto novaehollandiae | 0.005441 | 0.133506 | -5.287006 | 0.118066 | 2.817892 | 2.673422 | 23.74439 | 0.973118 | 1.01587 | 1.01587 |
Tyto rosenbergii | 0.017482 | 0.050442 | -6.726274 | 0.047239 | 3.007910 | 2.195342 | 15.59762 | 0.703452 | 1.00000 | 1.00000 |
Tyto sororcula | 1.898283 | 2.843938 | -3.321550 | 0.950148 | 2.216944 | 3.143125 | 27.69061 | 1.069381 | 3.57143 | 1.14286 |
Tyto soumagnei | 0.000597 | 0.003335 | -7.423642 | 0.003329 | 1.447254 | 1.583217 | 25.33012 | 17.829389 | 2.50000 | 1.00000 |
Tyto tenebricosa | 0.004449 | 0.041858 | -6.320811 | 0.040160 | 3.366388 | 1.983155 | 22.33658 | 1.896506 | 1.06061 | 1.03030 |
Uroglaux dimorpha | 1.764796 | 12.939867 | 0.568035 | 2.634753 | 0.388954 | 0.085256 | 6.12683 | 1.155273 | 1.83333 | 1.00000 |
Xenoglaux loweryi | 0.004662 | 0.225332 | -5.434949 | 0.187361 | 0.814889 | 0.138379 | 9.94426 | 0.242860 | 1.00000 | 1.00000 |
10.1 COrrelation between TSNE and UMAP space quantification
Code
cor(output_data$log.tsne.space.size, output_data$log.umap.space.size,
use = "pairwise.complete.obs")
[1] 0.697095
Code
# Create a scatterplot
<- ggplot(output_data, aes(x = log.tsne.space.size, y = log.umap.space.size,
gg_sc + geom_point(size = 4, color = viridis(10, alpha = 0.4)[7]) +
)) theme_classic(base_size = 20) + geom_smooth(method = "lm", se = FALSE) +
labs(x = "log(TSNE acoustic space sizes)", y = "log(UMAP acoustic space sizes)",
color = "Locality", fill = "Locality") + theme(legend.position = "none")
::ggMarginal(gg_sc, type = "histogram", fill = viridis(10,
ggExtraalpha = 0.4)[7], color = viridis(10)[7])
11 Takeaways
- Song level acoustic spaces were not quantified as most songs consisted of a single element
Session information
R version 4.3.2 (2023-10-31)
Platform: x86_64-pc-linux-gnu (64-bit)
Running under: Ubuntu 20.04.2 LTS
Matrix products: default
BLAS: /usr/lib/x86_64-linux-gnu/atlas/libblas.so.3.10.3
LAPACK: /usr/lib/x86_64-linux-gnu/atlas/liblapack.so.3.10.3; LAPACK version 3.9.0
locale:
[1] LC_CTYPE=pt_BR.UTF-8 LC_NUMERIC=C
[3] LC_TIME=es_CR.UTF-8 LC_COLLATE=pt_BR.UTF-8
[5] LC_MONETARY=es_CR.UTF-8 LC_MESSAGES=pt_BR.UTF-8
[7] LC_PAPER=es_CR.UTF-8 LC_NAME=C
[9] LC_ADDRESS=C LC_TELEPHONE=C
[11] LC_MEASUREMENT=es_CR.UTF-8 LC_IDENTIFICATION=C
time zone: America/Costa_Rica
tzcode source: system (glibc)
attached base packages:
[1] stats graphics grDevices utils datasets methods base
other attached packages:
[1] mice_3.16.0 viridis_0.6.5 viridisLite_0.4.2
[4] corrplot_0.92 PhenotypeSpace_0.1.0 ggplot2_3.5.0
[7] Rtsne_0.17 umap_0.2.10.0 ohun_1.0.2
[10] Rraven_1.0.14 warbleR_1.1.30 NatureSounds_1.0.4
[13] seewave_2.2.3 tuneR_1.4.6 xaringanExtra_0.7.0
[16] rprojroot_2.0.4 formatR_1.14 knitr_1.45
[19] kableExtra_1.4.0
loaded via a namespace (and not attached):
[1] rstudioapi_0.15.0 jsonlite_1.8.8 shape_1.4.6
[4] magrittr_2.0.3 sketchy_1.0.2 spatstat.utils_3.0-4
[7] jomo_2.7-6 farver_2.1.1 nloptr_2.0.3
[10] rmarkdown_2.25 vctrs_0.6.5 minqa_1.2.6
[13] RCurl_1.98-1.14 askpass_1.2.0 terra_1.7-71
[16] htmltools_0.5.7 broom_1.0.5 raster_3.6-26
[19] signal_1.8-0 mitml_0.4-5 KernSmooth_2.23-22
[22] htmlwidgets_1.6.4 testthat_3.2.1 igraph_1.6.0
[25] mime_0.12 lifecycle_1.0.4 iterators_1.0.14
[28] pkgconfig_2.0.3 Matrix_1.6-5 R6_2.5.1
[31] fastmap_1.1.1 shiny_1.8.0 digest_0.6.34
[34] colorspace_2.1-0 tensor_1.5 RSpectra_0.16-1
[37] vegan_2.6-4 labeling_0.4.3 fansi_1.0.6
[40] spatstat.sparse_3.0-3 polyclip_1.10-6 abind_1.4-5
[43] mgcv_1.9-1 compiler_4.3.2 proxy_0.4-27
[46] remotes_2.4.2.1 withr_3.0.0 backports_1.4.1
[49] DBI_1.2.2 pan_1.9 MASS_7.3-60.0.1
[52] openssl_2.1.1 rjson_0.2.21 classInt_0.4-10
[55] permute_0.9-7 tools_4.3.2 units_0.8-5
[58] httpuv_1.6.14 fftw_1.0-8 nnet_7.3-19
[61] goftest_1.2-3 glue_1.7.0 promises_1.2.1
[64] nlme_3.1-164 grid_4.3.2 sf_1.0-15
[67] checkmate_2.3.1 cluster_2.1.6 generics_0.1.3
[70] gtable_0.3.4 spatstat.data_3.0-4 class_7.3-22
[73] tidyr_1.3.1 spatstat.core_2.4-4 sp_2.1-3
[76] xml2_1.3.6 utf8_1.2.4 spatstat.geom_3.2-8
[79] foreach_1.5.2 pillar_1.9.0 stringr_1.5.1
[82] ggExtra_0.10.1 later_1.3.2 splines_4.3.2
[85] dplyr_1.1.4 lattice_0.22-5 survival_3.5-7
[88] deldir_2.0-2 tidyselect_1.2.0 miniUI_0.1.1.1
[91] pbapply_1.7-2 gridExtra_2.3 svglite_2.1.3
[94] xfun_0.42 brio_1.1.4 stringi_1.8.3
[97] yaml_2.3.8 boot_1.3-28.1 evaluate_0.23
[100] codetools_0.2-19 dtw_1.23-1 tibble_3.2.1
[103] cli_3.6.2 rpart_4.1.23 xtable_1.8-4
[106] reticulate_1.35.0 systemfonts_1.0.5 munsell_0.5.0
[109] Rcpp_1.0.12 spatstat.random_3.2-2 png_0.1-8
[112] parallel_4.3.2 ellipsis_0.3.2 bitops_1.0-7
[115] lme4_1.1-35.1 glmnet_4.1-8 scales_1.3.0
[118] e1071_1.7-14 packrat_0.9.2 purrr_1.0.2
[121] crayon_1.5.2 rlang_1.1.3 rgeos_0.6-4