diff --git a/0_update_cold_pool_index.Rmd b/0_update_cold_pool_index.Rmd index c1567cf..cba0c7e 100644 --- a/0_update_cold_pool_index.Rmd +++ b/0_update_cold_pool_index.Rmd @@ -55,30 +55,6 @@ if(update_sysdata) { coldpool:::get_data(channel = channel, include_preliminary_data = NULL) } -# Temporarily add unfinalized NBS data -- COMMENT OUT WHEN 2023 NBS DATA ARE FINALIZED - -# nbs_layers <- get_base_layers(select.region = "nbs", set.crs = "EPSG:4269") -# -# nbs_centroid <- nbs_layers$survey.grid |> -# sf::st_make_valid() |> -# sf::st_centroid() -# -# nbs_centroid <- cbind(nbs_centroid, -# sf::st_coordinates(nbs_centroid)) |> -# as.data.frame() |> -# dplyr::select(-geometry) |> -# dplyr::rename(longitude = X, -# latitude = Y, -# stationid = STATIONID) -# -# read.csv(file = here::here("data", "unfinalized_nbs_2023.csv")) |> -# dplyr::inner_join(nbs_centroid) |> -# dplyr::bind_rows( -# read.csv(file = nbs_ebs_csv_path) -# ) |> -# write.csv(file = nbs_ebs_csv_path) - - ``` @@ -94,7 +70,7 @@ Writes: interpolation_wrapper(temp_data_path = ebs_csv_path, proj_crs = proj_crs, cell_resolution = 5000, # 5x5 km grid resolution - select_years = 1982:2023, + select_years = 1982:2024, interp_variable = "gear_temperature", select_region = "sebs", methods = "Ste") @@ -103,7 +79,7 @@ interpolation_wrapper(temp_data_path = ebs_csv_path, interpolation_wrapper(temp_data_path = ebs_csv_path, proj_crs = proj_crs, cell_resolution = 5000, # 5x5 km grid resolution - select_years = 1982:2023, + select_years = 1982:2024, interp_variable = "surface_temperature", select_region = "sebs", methods = "Ste") @@ -201,7 +177,7 @@ nbs_area <- akgfmaps::get_base_layers(select.region = "ebs", dplyr::filter(SURVEY == "NBS_SHELF") nbs_ebs_bt_files <- list.files(here::here("output", "raster", "ebs", "gear_temperature"), - full.names = TRUE, + full.names = TRUE, pattern = "ste_") nbs_ebs_sst_files <- list.files(here::here("output", "raster", "ebs", "surface_temperature"), @@ -209,22 +185,31 @@ nbs_ebs_sst_files <- list.files(here::here("output", "raster", "ebs", "surface_t pattern = "ste_") nbs_mean_temperature <- data.frame(YEAR = numeric(length = length(nbs_ebs_bt_files)), - MEAN_GEAR_TEMPERATURE = numeric(length = length(nbs_ebs_bt_files)), - MEAN_SURFACE_TEMPERATURE = numeric(length = length(nbs_ebs_bt_files))) + MEAN_GEAR_TEMPERATURE = numeric(length = length(nbs_ebs_bt_files)), + MEAN_SURFACE_TEMPERATURE = numeric(length = length(nbs_ebs_bt_files))) for(i in 1:length(nbs_ebs_bt_files)) { nbs_bt_raster <- terra::rast(nbs_ebs_bt_files[i]) |> terra::mask(nbs_area, touches = FALSE) - nbs_mean_temperature$YEAR[i] <- as.numeric(gsub("[^0-9.-]", "", names(nbs_bt_raster))) # Extract year - - nbs_mean_temperature$MEAN_GEAR_TEMPERATURE[i] <- mean(terra::values(nbs_bt_raster), na.rm = TRUE) + nbs_mean_temperature$YEAR[i] <- as.numeric(gsub("[^0-9.-]", "", names(nbs_bt_raster))) # Extract year + + nbs_mean_temperature$MEAN_GEAR_TEMPERATURE[i] <- mean(terra::values(nbs_bt_raster), na.rm = TRUE) + + nbs_mean_temperature$AREA_LTE2_KM2[i] <- nbs_bt_raster |> + cpa_from_raster(raster_units = "m", temperature_threshold = 2) + nbs_mean_temperature$AREA_LTE1_KM2[i] <- nbs_bt_raster |> + cpa_from_raster(raster_units = "m", temperature_threshold = 1) + nbs_mean_temperature$AREA_LTE0_KM2[i] <- nbs_bt_raster |> + cpa_from_raster(raster_units = "m", temperature_threshold = 0) + nbs_mean_temperature$AREA_LTEMINUS1_KM2[i] <- nbs_bt_raster |> + cpa_from_raster(raster_units = "m", temperature_threshold = -1) - # Don't calculate SST if NBS data haven't been finalized + # Don't calculate SST if NBS data haven't been finalized if(file.exists(nbs_ebs_sst_files[i])) { - nbs_sst_raster <- terra::rast(nbs_ebs_sst_files[i]) |> - terra::mask(nbs_area, touches = FALSE) - + nbs_sst_raster <- terra::rast(nbs_ebs_sst_files[i]) |> + terra::mask(nbs_area, touches = FALSE) + nbs_mean_temperature$MEAN_SURFACE_TEMPERATURE[i] <- mean(terra::values(nbs_sst_raster), na.rm = TRUE) } else { nbs_mean_temperature$MEAN_SURFACE_TEMPERATURE[i] <- NA @@ -232,7 +217,7 @@ for(i in 1:length(nbs_ebs_bt_files)) { } - nbs_mean_temperature <- nbs_mean_temperature |> +nbs_mean_temperature <- nbs_mean_temperature |> dplyr::filter(YEAR != 2018) nbs_mean_temperature$LAST_UPDATE <- Sys.Date() diff --git a/2022_cold_pool_index_esr.docx b/2022_cold_pool_index_esr.docx deleted file mode 100644 index 92afa72..0000000 Binary files a/2022_cold_pool_index_esr.docx and /dev/null differ diff --git a/2024_cold_pool_index.Rmd b/2024_cold_pool_index.Rmd new file mode 100644 index 0000000..5f0e56b --- /dev/null +++ b/2024_cold_pool_index.Rmd @@ -0,0 +1,1084 @@ +--- +title: "Summer Bottom and Surface Temperatures, and the Cold Pool Index" +author: +- affiliation: RACE + description: Research Fish Biologist + email: Sean.Rohan@noaa.gov + name: Sean Rohan +output: word_document +fontsize: 12pt +bibliography: coldpool_refs.bib +csl: fish-and-fisheries.csl +addr: + l1: 7600 Sand Point Way NE + l2: NMFS RACE Division, Groundfish Assessment Program + l3: Seattle, WA 98115 +--- + +```{r setup, message=FALSE, warning=FALSE, include=FALSE} +library(coldpool) +library(akgfmaps) + +if(!dir.exists("plots")) {dir.create("plots")} + +fig_res <- 600 +cpa_palette <- c("#21dae7", "#0071ff", "#0000e3", "#000040") +max_year <- 2024 +min_year <- max_year - 19 # Default for 20 panel cold pool maps + +coldpool:::cold_pool_index$YEAR[order(coldpool:::cold_pool_index$AREA_LTE2_KM2)] +coldpool:::cold_pool_index$YEAR[order(-1*coldpool:::cold_pool_index$MEAN_GEAR_TEMPERATURE)] +coldpool:::cold_pool_index$YEAR[order(-1*coldpool:::cold_pool_index$MEAN_SURFACE_TEMPERATURE)] +``` + +```{r fig1_cold_pool_index, message=FALSE, warning=FALSE, include=FALSE} + +cpi_df <- coldpool:::cold_pool_index |> + dplyr::filter(YEAR <= max_year) |> + dplyr::mutate(group = YEAR < 2020, + var = "Cold Pool Index", + cpi_rank = rank(AREA_LTE2_KM2)) + +cpi_sd <- sd(cpi_df$AREA_LTE2_KM2/1000) +cpi_mean <- mean(cpi_df$AREA_LTE2_KM2/1000) + +plot_cpi_timeseries <- ggplot(data = cpi_df, + mapping = aes(x = YEAR, + y = AREA_LTE2_KM2/1000, + group = group, + label = cpi_rank)) + + geom_point(size = rel(2), + color = "#000040") + + geom_line(color = "#000040") + + geom_hline(yintercept = cpi_mean, + linetype = 2, + color = "#000040") + + geom_hline(yintercept = cpi_mean + c(cpi_sd, -1*cpi_sd), + linetype = 3, + color = "#000040") + + scale_y_continuous(name = expression(bold("Cold Pool Extent"~("thousand"~km^2)))) + + scale_x_continuous(name = "Year", + breaks = seq(1980,2020,4)) + + facet_wrap(~var) + + theme_bw() + + theme(axis.title = element_text(color = "black", face = "bold"), + axis.text = element_text(color = "black"), + axis.ticks = element_line(color = "black"), + panel.grid = element_blank(), + legend.title = element_blank(), + legend.position = "bottom", + strip.text = element_text(size = 9, + color = "white", + face = "bold", + margin = margin(0.5, 0, 0.5, 0, "mm")), + strip.background = element_rect(fill = "#0055a4", + color = NA)) + +ragg::agg_png(filename = here::here("plots", paste0(max_year, "_cold_pool_index.png")), + width = 6, + height = 3, + units = "in", + res = 300) +print(plot_cpi_timeseries) +dev.off() +``` + + +```{r fig2_cpa_stacked_area, message=FALSE, warning=FALSE, include=FALSE} +sebs_layers <- akgfmaps::get_base_layers(select.region = "sebs", + set.crs = coldpool:::ebs_proj_crs) + +area_df <- coldpool:::cold_pool_index |> + dplyr::filter(YEAR <= max_year) |> + dplyr::mutate(lteminus1 = AREA_LTEMINUS1_KM2, + lte0 = AREA_LTE0_KM2 - AREA_LTEMINUS1_KM2, + lte1 = AREA_LTE1_KM2 - AREA_LTE0_KM2, + lte2 = AREA_LTE2_KM2 - AREA_LTE1_KM2) |> + dplyr::select(YEAR, lteminus1, lte0, lte1, lte2) |> + reshape2::melt(id.vars = "YEAR") |> + dplyr::mutate(variable = factor(variable, + levels = c( "lte2", "lte1", "lte0", "lteminus1"), + labels = c("\u22642 \u00b0C", "\u22641 \u00b0C", "\u22640 \u00b0C", "\u2264-1 \u00b0C")), + proportion = value/sebs_layers$survey.area$AREA_KM2) + +stacked_area_plot <- ggplot() + + geom_area(data = filter(area_df, YEAR < 2020), + mapping = aes(x = YEAR, + y = proportion, + fill = variable)) + + geom_area(data = filter(area_df, YEAR > 2020), + mapping = aes(x = YEAR, + y = proportion, + fill = variable)) + + scale_fill_manual(name = "Temperature", + values = cpa_palette) + + scale_y_continuous(name = "Proportion of EBS Shelf (Plus NW) Survey Area", + limits = c(0, 1), + expand = c(0, 0), + breaks = seq(0,1,0.1)) + + scale_x_continuous(name = "Year", + limits = c(1982, max_year + 0.25), + expand = c(0, 0), + breaks = seq(1982, max_year, 4)) + + theme_bw() + + theme(panel.grid.minor = element_blank(), + axis.title = element_text(face = "bold"), + axis.ticks = element_line(color = "black"), + panel.border = element_rect(color = "black", fill = NA), + panel.background = element_rect(color = "black", fill = NA), + legend.position = c(0.2, 0.8), + legend.title = element_blank()) + +ragg::agg_png(file = here::here("plots", paste0(max_year, "_stacked_temperature.png")), height = 4, width = 6, units = "in", res = 600) +print(stacked_area_plot) +dev.off() + +stacked_area_simple_label_plot <- ggplot() + + geom_area(data = filter(area_df, YEAR < 2020), + mapping = aes(x = YEAR, + y = proportion, + fill = variable)) + + geom_area(data = filter(area_df, YEAR > 2020), + mapping = aes(x = YEAR, + y = proportion, + fill = variable)) + + scale_fill_manual(name = "Temperature", + values = viridis::mako(5, direction = -1, end = .8)) + + scale_y_continuous(name = "Proportion of EBS Shelf Survey Area", + limits = c(0, 1), + expand = c(0, 0), + breaks = seq(0,1,0.1)) + + scale_x_continuous(name = "Year", + limits = c(1982, max_year + 0.25), + expand = c(0, 0), + breaks = seq(1982, max_year,4)) + + theme_bw() + + theme(panel.grid.minor = element_blank(), + axis.title = element_text(face = "bold"), + axis.ticks = element_line(color = "black"), + panel.border = element_rect(color = "black", fill = NA), + panel.background = element_rect(color = "black", fill = NA), + legend.position = c(0.1, 0.8), + legend.title = element_blank()) + +ragg::agg_png(file = here::here("plots", paste0(max_year, "_stacked_temperature_simple_label.png")), height = 4, width = 6, units = "in", res = 600) +print(stacked_area_simple_label_plot) +dev.off() + +year_vec <- as.numeric(gsub("[^0-9.-]", "", names(terra::rast(coldpool:::ebs_bottom_temperature)))) +start_year <- which(year_vec == min_year) +end_year <- which(year_vec == max_year) + +for(i in start_year:end_year) { + + sel_layer_df <- as.data.frame(terra::rast(coldpool:::ebs_bottom_temperature)[[i]], + na.rm = FALSE, + xy = TRUE) |> + tidyr::pivot_longer(cols = 3) |> + sf::st_as_sf(coords = c("x", "y"), + crs = coldpool:::ebs_proj_crs) |> + dplyr::rename(year = name, + temperature = value) |> + stars::st_rasterize() + + sel_layer_df$temperature <- cut(sel_layer_df$temperature, + breaks = c(-2, -1, 0, 1, 2)) + + sel_layer_df <- sel_layer_df |> + sf::st_as_sf() |> + dplyr::group_by(temperature) |> + dplyr::summarise(n = n()) |> + dplyr::select(-n) |> + dplyr::ungroup() |> + sf::st_intersection(sebs_layers$survey.area) + + sel_layer_df$year <- year_vec[i] + + if(i == start_year) { + bt_year_df <- sel_layer_df + } else{ + bt_year_df <- dplyr::bind_rows(bt_year_df, sel_layer_df) + } +} + +cpa_palette <- c("#21dae7", "#0071ff", "#0000e3", "#000040") + +panel_extent <- data.frame(y = c(52, 64), + x = c(-175, -156)) |> + akgfmaps::transform_data_frame_crs(out.crs = coldpool:::ebs_proj_crs) + +label_2020 <- data.frame(x = mean(panel_extent$x), + y = mean(panel_extent$y), + label = "No\nSurvey", + year = 2020) |> + dplyr::filter(year <= max_year) + +cold_pool_cbar <- coldpool::legend_discrete_cbar(breaks = c(-Inf, -1, 0, 1, 2), + colors = rev(cpa_palette), + legend_direction = "vertical", + font_size = 3.5, + width = 0.1, + expand_size.x = 0.3, + expand_size.y = 0.3, + expand.x = 0.2, + expand.y = 0.9, + spacing_scaling = 1, + text.hjust = 0, + font.family = "sans", + neat.labels = FALSE) + + annotate("text", + x = 1.1, + y = 2.05, + label = expression(bold("Bottom\nTemperature"~(degree*C))), + size = rel(3.2)) + + theme(plot.margin = unit(c(-25, 0,0,-10), units = "pt")) + +cold_pool_panels <- ggplot() + + geom_sf(data = sebs_layers$akland, fill = "black", + color = NA) + + geom_sf(data = sebs_layers$survey.area, fill = "grey75") + + geom_sf(data = bt_year_df, + mapping = aes(fill = temperature), + color = NA) + + geom_sf(data = sebs_layers$survey.area, + fill = NA, + color = "black") + + geom_sf(data = sebs_layers$bathymetry) + + geom_polygon(data = data.frame(x = panel_extent$x[c(1,2,2,1,1)], + y = panel_extent$y[c(1,1,2,2,1)], + year = 2020) |> dplyr::filter(year <= max_year), + aes(x = x, + y = y), + fill = "white") + + geom_label(data = label_2020, + aes(x = x, + y = y, + label = label), + label.size = NA) + + coord_sf(xlim = panel_extent$x, + ylim = panel_extent$y, + expand = FALSE) + + scale_x_continuous(name = "Longitude", + breaks = c(-180, -170, -160)) + + scale_y_continuous(name = "Latitude", + breaks = c(54, 58, 62)) + + scale_fill_manual(name = expression("T"~(degree*C)), + values = rev(cpa_palette), + drop = FALSE, + na.value = NA) + + theme_bw() + + theme(axis.title = element_blank(), + axis.text = element_text(color = "black"), + axis.ticks = element_line(color = "black"), + panel.border = element_rect(color = "black", fill = NA), + panel.background = element_rect(color = "black", fill = NA), + strip.text = element_text(size = 9, + color = "white", + face = "bold", + margin = margin(0.5, 0, 0.5, 0, "mm")), + strip.background = element_rect(fill = "#0055a4", + color = NA), + legend.position = "none") + + facet_wrap(~year, ncol = 4) + +cold_pool_grid <- cowplot::plot_grid( + cold_pool_panels, + cowplot::plot_grid(NA, cold_pool_cbar, NA, + nrow = 3), + rel_widths = c(0.9,0.2) +) + +coldpool_with_area <- + cowplot::plot_grid( + cowplot::plot_grid( + cold_pool_panels, + stacked_area_plot + + facet_wrap(~"Proportion of EBS Shelf Survey Area") + + scale_y_continuous(name = "Proportion", + limits = c(0, 1), + expand = c(0, 0), + breaks = seq(0,1,0.1)) + + theme(legend.position = "none", + plot.margin = unit(c(-5,5,5,5), units = "pt"), + strip.text = element_text(size = 9, + color = "white", + face = "bold", + margin = margin(0.5, 0, 0.5, 0, "mm")), + strip.background = element_rect(fill = "#0055a4", + color = NA)), + rel_heights = c(0.75, 0.25), + align = "h", + nrow = 2), + cowplot::plot_grid(NA, cold_pool_cbar, NA, + nrow = 3, + rel_heights = c(0.2, 0.6, 0.2)), + rel_widths = c(0.9,0.2) + ) + +ragg::agg_png(file = here::here("plots", paste0(max_year, "_coldpool_with_area.png")), height = 8, width = 6, units = "in", res = fig_res) +print(coldpool_with_area) +dev.off() + +ragg::agg_png(file = here::here("plots", paste0(max_year, "_coldpool.png")), height = 6, width = 6, units = "in", res = fig_res) +print(cold_pool_grid) +graphics.off() +``` + +```{r fig3_nbs_ebs_map, message=FALSE, warning=FALSE, include=FALSE} +nbs_ebs_temp_breaks <- c(-Inf, seq(-1,8,1), Inf) +nbs_ebs_viridis_option <- "H" # viridis turbo palette + +nbs_ebs_layers <- akgfmaps::get_base_layers(select.region = "ebs", + set.crs = coldpool:::ebs_proj_crs) + +year_vec_nbs <- as.numeric(gsub("[^0-9.-]", "", names(terra::rast(coldpool:::nbs_ebs_bottom_temperature)))) + +year_vec_sbs <- as.numeric(gsub("[^0-9.-]", "", names(terra::rast(coldpool:::ebs_bottom_temperature)))) + +year_vec_grid <- tail(sort(unique(c(year_vec_nbs, year_vec_sbs))), 4) + +end_nbs_year <- which.min(abs(year_vec_nbs - max_year)) + +max_nbs_year <- year_vec_nbs[end_nbs_year] + +if(max_year %in% year_vec_nbs) { + bt_year <- terra::rast(coldpool:::nbs_ebs_bottom_temperature)[[length(year_vec_nbs)]] +} else { + bt_year <- terra::rast(coldpool:::ebs_bottom_temperature)[[length(year_vec_sbs)]] +} + + +bt_year_df <- as.data.frame(bt_year, + na.rm = FALSE, + xy = TRUE) |> + tidyr::pivot_longer(cols = 3) |> + sf::st_as_sf(coords = c("x", "y"), + crs = coldpool:::ebs_proj_crs) |> + dplyr::rename(year = name, + temperature = value) |> + stars::st_rasterize() + +bt_year_df$temperature <- cut(bt_year_df$temperature, + breaks = nbs_ebs_temp_breaks) + +bt_year_df <- bt_year_df |> + sf::st_as_sf() |> + dplyr::group_by(temperature) |> + dplyr::summarise(n = n()) |> + dplyr::select(-n) |> + dplyr::ungroup() |> + sf::st_intersection(nbs_ebs_layers$survey.area) + +# Union to combine strata 31, 32 into 30, etc. +nbs_ebs_agg_strata <- nbs_ebs_layers$survey.strata |> + dplyr::mutate(agg_stratum = Stratum) |> + dplyr::mutate(agg_stratum = replace(agg_stratum, agg_stratum %in% c(31,32), 30), + agg_stratum = replace(agg_stratum, agg_stratum %in% c(41,42,43), 40), + agg_stratum = replace(agg_stratum, agg_stratum %in% c(61,62), 60)) |> + dplyr::group_by(agg_stratum) |> + dplyr::summarise() + + +# Format and layout + +panel_extent <- data.frame(y = c(53, 67), + x = c(-174, -156)) |> + akgfmaps::transform_data_frame_crs(out.crs = coldpool:::ebs_proj_crs) + +n_temp_breaks <- length(nbs_ebs_temp_breaks)-1 + + +temp_map_cbar <- coldpool::legend_discrete_cbar(breaks = nbs_ebs_temp_breaks, + colors = viridis::viridis_pal(option = nbs_ebs_viridis_option)(n_temp_breaks), + legend_direction = "horizontal", + font_size = 3, + width = 0.1, + expand_size.x = 0.3, + expand_size.y = 0.3, + expand.x = 0.3, + expand.y = 0.9, + spacing_scaling = 1, + text.hjust = 0.5, + font.family = "sans", + neat.labels = FALSE) + + annotate("text", + x = 1.15, + y = 3.5, + label = expression(bold("Bottom Temperature"~(degree*C))), + size = rel(3.2)) + + theme(plot.margin = unit(c(0,0, 0, 5), units = "mm")) + +# Make map +ebs_nbs_temperature_map <- ggplot2::ggplot() + + ggplot2::geom_sf(data = nbs_ebs_layers$akland, + fill = "grey70", + color = "black") + + ggplot2::geom_sf(data = nbs_ebs_layers$survey.area, + fill = "grey85") + + ggplot2::geom_sf(data = bt_year_df, + mapping = aes(fill = temperature), + color = NA) + + ggplot2::geom_sf(data = nbs_ebs_agg_strata, + fill = NA, + color = "black") + + ggplot2::geom_text(data = data.frame(x = -158.5, + y = 62.4, + lab = "Alaska") |> + akgfmaps::transform_data_frame_crs(out.crs = coldpool:::ebs_proj_crs), + mapping = aes(x = x, + y = y, + label = lab), + size = rel(8)) + + ggplot2::coord_sf(xlim = panel_extent$x, + ylim = panel_extent$y) + + ggplot2::scale_x_continuous(name = "Longitude", + breaks = nbs_ebs_layers$lon.breaks) + + ggplot2::scale_y_continuous(name = "Latitude", + breaks = nbs_ebs_layers$lat.breaks) + + ggplot2::scale_fill_manual(values = viridis_pal(option = nbs_ebs_viridis_option)(n_temp_breaks), + drop = FALSE) + + theme_bw() + + ggplot2::theme(axis.title = element_blank(), + axis.text = element_text(color = "black"), + axis.ticks = element_line(color = "black"), + panel.border = element_rect(color = "black", fill = NA), + panel.background = element_rect(color = "black", fill = NA), + legend.key.width = unit(12, "mm"), + legend.position = "none", + legend.direction = "horizontal", + plot.margin = unit(c(5.5, 5.5,-25,5.5), units = "pt")) + +ebs_nbs_map <- cowplot::plot_grid(ebs_nbs_temperature_map, + temp_map_cbar, + nrow = 2, + rel_heights = c(0.8,0.2)) + +ragg::agg_png(filename = here::here("plots", paste0(max_year, "_nbs_ebs_temperature_map.png")), width = 6, height = 6, units = "in", res = fig_res) +print(ebs_nbs_map) +dev.off() + +nbs_ebs_bt_stack <- terra::rast(coldpool:::nbs_ebs_bottom_temperature) +ebs_bt_stack <- terra::rast(coldpool:::ebs_bottom_temperature) + +template_rast <- nbs_ebs_bt_stack[[1]] + +template_sbs <- nbs_ebs_layers$survey.area |> + dplyr::filter(SURVEY == "EBS_SHELF") + +for(i in 1:length(year_vec_grid)) { + + if(all(tail(year_vec_grid, 4) %in% year_vec_nbs)) { + + sel_layer_df <- nbs_ebs_bt_stack[[i]] + + } else if(any(tail(year_vec_grid, 4) %in% year_vec_nbs)) { + + if(year_vec_grid[i] %in% names(nbs_ebs_bt_stack)) { + + sel_layer_df <- nbs_ebs_bt_stack[[which(names(nbs_ebs_bt_stack) == year_vec_grid[i])]] + + } else { + + sel_layer_df <- ebs_bt_stack[[which(names(ebs_bt_stack) == year_vec_grid[i])]] |> + terra::resample(template_rast) |> + terra::mask(template_sbs, touches = FALSE) + + } + + sel_layer_df <- sel_layer_df |> + as.data.frame(na.rm = FALSE, + xy = TRUE) |> + tidyr::pivot_longer(cols = 3) |> + sf::st_as_sf(coords = c("x", "y"), + crs = coldpool:::ebs_proj_crs) |> + dplyr::rename(year = name, + temperature = value) |> + stars::st_rasterize() + + sel_layer_df$temperature <- cut(sel_layer_df$temperature, + breaks = nbs_ebs_temp_breaks) + + sel_layer_df <- sel_layer_df |> + sf::st_as_sf() |> + dplyr::group_by(temperature) |> + dplyr::summarise(n = n()) |> + dplyr::select(-n) |> + dplyr::ungroup() |> + sf::st_intersection(nbs_ebs_layers$survey.area) + + + } + + sel_layer_df$year <- year_vec_grid[i] + + if(i == 1) { + bt_year_df <- sel_layer_df + } else{ + bt_year_df <- dplyr::bind_rows(bt_year_df, sel_layer_df) + } +} + + + +nbs_ebs_st_stack <- terra::rast(coldpool:::nbs_ebs_surface_temperature) +ebs_st_stack <- terra::rast(coldpool:::ebs_surface_temperature) + +template_rast <- nbs_ebs_st_stack[[1]] + +template_sbs <- nbs_ebs_layers$survey.area |> + dplyr::filter(SURVEY == "EBS_SHELF") + +for(i in 1:length(year_vec_grid)) { + + if(all(tail(year_vec_grid, 4) %in% year_vec_nbs)) { + + sel_layer_df <- nbs_ebs_st_stack[[i]] + + } else if(any(tail(year_vec_grid, 4) %in% year_vec_nbs)) { + + if(year_vec_grid[i] %in% names(nbs_ebs_st_stack)) { + + sel_layer_df <- nbs_ebs_st_stack[[which(names(nbs_ebs_st_stack) == year_vec_grid[i])]] + + } else { + + sel_layer_df <- ebs_st_stack[[which(names(ebs_st_stack) == year_vec_grid[i])]] |> + terra::resample(template_rast) |> + terra::mask(template_sbs, touches = FALSE) + + } + + sel_layer_df <- sel_layer_df |> + as.data.frame(na.rm = FALSE, + xy = TRUE) |> + tidyr::pivot_longer(cols = 3) |> + sf::st_as_sf(coords = c("x", "y"), + crs = coldpool:::ebs_proj_crs) |> + dplyr::rename(year = name, + temperature = value) |> + stars::st_rasterize() + + sel_layer_df$temperature <- cut(sel_layer_df$temperature, + breaks = nbs_ebs_temp_breaks) + + sel_layer_df <- sel_layer_df |> + sf::st_as_sf() |> + dplyr::group_by(temperature) |> + dplyr::summarise(n = n()) |> + dplyr::select(-n) |> + dplyr::ungroup() |> + sf::st_intersection(nbs_ebs_layers$survey.area) + + + } + + sel_layer_df$year <- year_vec_grid[i] + + if(i == 1) { + sst_year_df <- sel_layer_df + } else{ + sst_year_df <- dplyr::bind_rows(sst_year_df, sel_layer_df) + } +} + + +# Four panel bottom and surface temperature maps + +# Union to combine strata 31, 32 into 30, etc. +nbs_ebs_agg_strata <- nbs_ebs_layers$survey.strata |> + dplyr::mutate(agg_stratum = Stratum) |> + dplyr::mutate(agg_stratum = replace(agg_stratum, agg_stratum %in% c(31, 32), 30), + agg_stratum = replace(agg_stratum, agg_stratum %in% c(41, 42, 43), 40), + agg_stratum = replace(agg_stratum, agg_stratum %in% c(61, 62), 60)) |> + dplyr::group_by(agg_stratum) |> + dplyr::summarise() + +ebs_nbs_bt_temperature_map <- ggplot2::ggplot() + + ggplot2::geom_sf(data = nbs_ebs_layers$akland, + fill = "grey70", + color = "black") + + ggplot2::geom_sf(data = nbs_ebs_layers$survey.area, + fill = "grey85", + color = "black") + + ggplot2::geom_sf(data = bt_year_df, + mapping = aes(fill = temperature), + color = NA) + + ggplot2::geom_sf(data = nbs_ebs_layers$survey.area, + fill = NA, + color = "black") + + ggplot2::facet_wrap(~year, ncol = 2, nrow = 2) + + ggplot2::geom_sf(data = nbs_ebs_agg_strata, + fill = NA, + color = "black") + + ggplot2::geom_sf(data = nbs_ebs_layers$graticule, + alpha = 0.3) + + ggplot2::coord_sf(xlim = nbs_ebs_layers$plot.boundary$x, + ylim = nbs_ebs_layers$plot.boundary$y) + + ggplot2::scale_x_continuous(name = "Longitude", + breaks = nbs_ebs_layers$lon.breaks) + + ggplot2::scale_y_continuous(name = "Latitude", + breaks = nbs_ebs_layers$lat.breaks) + + ggplot2::scale_fill_manual(values = viridis_pal(option = nbs_ebs_viridis_option)(length(nbs_ebs_temp_breaks)-1), + na.value = NA) + + coldpool::theme_multi_map_blue_strip() + + theme(legend.position = "none", + plot.margin = unit(c(5,5,-5,5), units = "mm"), + axis.title = element_blank(), + axis.text = element_text(size = 9)) + +ebs_nbs_bt_map_grid <- cowplot::plot_grid(ebs_nbs_bt_temperature_map, + temp_map_cbar, + nrow = 2, + rel_heights = c(0.85,0.15)) + +ragg::agg_png(filename = here::here("plots", paste0(max_year, "_nbs_ebs_temperature_map_grid.png")), width = 6, height = 6, units = "in", res = fig_res) +print(ebs_nbs_bt_map_grid) +dev.off() + +ebs_nbs_sst_temperature_map <- ggplot2::ggplot() + + ggplot2::geom_sf(data = nbs_ebs_layers$akland, + fill = "grey70", + color = "black") + + ggplot2::geom_sf(data = nbs_ebs_layers$survey.area, + fill = "grey85", + color = "black") + + ggplot2::geom_sf(data = sst_year_df, + mapping = aes(fill = temperature), + color = NA) + + ggplot2::facet_wrap(~year, ncol = 2, nrow = 2) + + ggplot2::geom_sf(data = nbs_ebs_agg_strata, + fill = NA, + color = "black") + + ggplot2::geom_sf(data = nbs_ebs_layers$graticule, + alpha = 0.3) + + ggplot2::coord_sf(xlim = nbs_ebs_layers$plot.boundary$x, + ylim = nbs_ebs_layers$plot.boundary$y) + + ggplot2::scale_x_continuous(name = "Longitude", + breaks = nbs_ebs_layers$lon.breaks) + + ggplot2::scale_y_continuous(name = "Latitude", + breaks = nbs_ebs_layers$lat.breaks) + + ggplot2::scale_fill_manual(values = viridis_pal(option = nbs_ebs_viridis_option)(length(nbs_ebs_temp_breaks)-1), + na.value = NA, + drop = FALSE) + + coldpool::theme_multi_map_blue_strip() + + theme(legend.position = "none", + plot.margin = unit(c(5,5,-5,5), units = "mm"), + axis.title = element_blank(), + axis.text = element_text(size = 9)) + +sst_map_cbar <- coldpool::legend_discrete_cbar(breaks = nbs_ebs_temp_breaks, + colors = viridis::viridis_pal(option = nbs_ebs_viridis_option), + legend_direction = "horizontal", + font_size = 3, + width = 0.1, + expand_size.x = 0.3, + expand_size.y = 0.3, + expand.x = 0.3, + expand.y = 0.9, + spacing_scaling = 1.2, + text.hjust = 0.5, + font.family = "sans", + neat.labels = FALSE) + + annotate("text", + x = 1.15, + y = 3.5, + label = expression(bold("Surface Temperature"~(degree*C))), + size = rel(3.2)) + + theme(plot.margin = unit(c(0,0, 0, 5), units = "mm")) + +ebs_nbs_sst_map_grid <- cowplot::plot_grid(ebs_nbs_sst_temperature_map, + sst_map_cbar, + nrow = 2, + rel_heights = c(0.85,0.15)) + +ragg::agg_png(filename = here::here("plots", paste0(max_year, "_nbs_ebs_sst_map_grid.png")), width = 6, height = 6, units = "in", res = fig_res) +print(ebs_nbs_sst_map_grid) +dev.off() + +``` + +```{r fig4_mean_temperature, message=FALSE, warning=FALSE, include=FALSE} +sebs_temperatures <- coldpool:::cold_pool_index |> + dplyr::filter(YEAR <= max_year) |> + dplyr::select(YEAR, MEAN_GEAR_TEMPERATURE, MEAN_SURFACE_TEMPERATURE) |> + dplyr::rename(Bottom = MEAN_GEAR_TEMPERATURE, + Surface = MEAN_SURFACE_TEMPERATURE) |> + dplyr::mutate(group = YEAR < 2020, + region = "Eastern Bering Sea (summer BT survey)") |> + reshape2::melt(id.vars = c("YEAR", "group", "region")) + +nbs_temperatures <- coldpool:::nbs_mean_temperature |> + dplyr::filter(YEAR <= max_year) |> + dplyr::select(YEAR, MEAN_GEAR_TEMPERATURE, MEAN_SURFACE_TEMPERATURE) |> + dplyr::rename(Bottom = MEAN_GEAR_TEMPERATURE, + Surface = MEAN_SURFACE_TEMPERATURE) |> + dplyr::mutate(group = YEAR, + region = "Northern Bering Sea (summer BT survey)") |> + reshape2::melt(id.vars = c("YEAR", "group", "region")) + +all_temperatures <- dplyr::bind_rows(sebs_temperatures, + nbs_temperatures) + +sebs_sst_mean <- mean(sebs_temperatures$value[sebs_temperatures$variable == "Surface"]) +sebs_bt_mean <- mean(sebs_temperatures$value[sebs_temperatures$variable == "Bottom"]) +nbs_sst_mean <- mean(nbs_temperatures$value[nbs_temperatures$variable == "Surface"]) +nbs_bt_mean <- mean(nbs_temperatures$value[nbs_temperatures$variable == "Bottom"]) + +color_sst <- "darkgreen" +color_bt <- "darkblue" + +ebs_mean_temp_df <- data.frame(region = c(rep("Eastern Bering Sea (summer BT survey)", 2), + rep("Northern Bering Sea (summer BT survey)", 2)), + variable = rep(c("Bottom", "Surface"), 2), + value = c(sebs_bt_mean, + sebs_sst_mean, + nbs_bt_mean, + nbs_sst_mean)) + +plot_average_temperature <- ggplot(data = all_temperatures, + mapping = aes(x = YEAR, + y = value, + color = variable, + shape = variable, + group = paste0(group, variable))) + + geom_point(size = rel(2)) + + geom_line() + + geom_hline(data = ebs_mean_temp_df, + aes(yintercept = value, + color = variable), + linetype = 2) + + scale_color_manual(values = c(color_bt, color_sst), + drop = FALSE) + + scale_y_continuous(name = expression(bold("Average Temperature"~(degree*C))), + limits = c(0,11.2), + breaks = seq(0,12,2), + expand = c(0,0)) + + scale_x_continuous(name = "Year", + breaks = seq(1980,2020,10)) + + facet_wrap(~region, scales = "free") + + theme_bw() + + theme(axis.title = element_text(color = "black", face = "bold"), + axis.text = element_text(color = "black"), + axis.ticks = element_line(color = "black"), + panel.border = element_rect(color = "black", fill = NA), + panel.background = element_rect(color = "black", fill = NA), + panel.grid = element_blank(), + legend.title = element_blank(), + legend.position = "bottom", + legend.key = element_rect(color = NA), + strip.text = element_text(size = 9, + color = "white", + face = "bold", + margin = margin(0.5, 0, 0.5, 0, "mm")), + strip.background = element_rect(fill = "#0055a4", + color = NA)) + +plot_sebs_average_temperature <- ggplot(data = all_temperatures |> + dplyr::filter(region == "Eastern Bering Sea (summer BT survey)"), + mapping = aes(x = YEAR, + y = value, + color = variable, + shape = variable, + group = paste0(group, variable))) + + geom_point(size = rel(2)) + + geom_line() + + geom_hline(data = ebs_mean_temp_df |> + dplyr::filter(region == "Eastern Bering Sea (summer BT survey)"), + aes(yintercept = value, + color = variable), + linetype = 2) + + scale_color_manual(values = c(color_bt, color_sst), + drop = FALSE) + + scale_y_continuous(name = expression(bold("Average Temperature"~(degree*C))), + limits = c(0,11.2), + breaks = seq(0,12,2), + expand = c(0,0)) + + scale_x_continuous(name = "Year", + breaks = seq(1980,2020,10)) + + facet_wrap(~region, scales = "free") + + theme_bw() + + theme(axis.title = element_text(color = "black", face = "bold"), + axis.text = element_text(color = "black"), + axis.ticks = element_line(color = "black"), + panel.border = element_rect(color = "black", fill = NA), + panel.background = element_rect(color = "black", fill = NA), + panel.grid = element_blank(), + legend.title = element_blank(), + legend.key = element_rect(color = NA), + legend.position = "bottom", + strip.text = element_text(size = 9, + color = "white", + face = "bold", + margin = margin(0.5, 0, 0.5, 0, "mm")), + strip.background = element_rect(fill = "#0055a4", + color = NA)) + +ragg::agg_png(file = here::here("plots", paste0(max_year, "_average_temperature.png")), width = 6, height = 3, units = "in", res = fig_res) +print(plot_average_temperature) +dev.off() + +ragg::agg_png(file = here::here("plots", paste0(max_year, "_plot_sebs_average_temperature.png")), width = 6, height = 3, units = "in", res = fig_res) +print(plot_sebs_average_temperature) +dev.off() +``` + +```{r zscore_temperature, message=FALSE, warning=FALSE, include=FALSE} +cp_summary <- dplyr::bind_rows( + dplyr::mutate(cold_pool_index, + diff = MEAN_GEAR_TEMPERATURE - mean(MEAN_GEAR_TEMPERATURE)) |> + dplyr::mutate(sign = sign(diff), + z = diff/sd(MEAN_GEAR_TEMPERATURE)) |> + dplyr::inner_join(data.frame(sign = c(-1,1), + symbol = c("-","+"), + col = c(1,2))) |> + dplyr::select(YEAR, diff, symbol, z, col) |> + dplyr::mutate(var = "Bottom temperature"), + dplyr::mutate(cold_pool_index, + diff = MEAN_SURFACE_TEMPERATURE - mean(MEAN_SURFACE_TEMPERATURE)) |> + dplyr::mutate(sign = sign(diff), + z = diff/sd(MEAN_SURFACE_TEMPERATURE)) |> + dplyr::inner_join(data.frame(sign = c(-1,1), + symbol = c("-","+"), + col = c(1,2))) |> + dplyr::select(YEAR, diff, symbol, z, col) |> + dplyr::mutate(var = "Sea surface temperature"), + dplyr::mutate(cold_pool_index, + diff = AREA_LTE2_KM2 - mean(AREA_LTE2_KM2)) |> + dplyr::mutate(sign = sign(diff), + z = diff/sd(AREA_LTE2_KM2)) |> + dplyr::inner_join(data.frame(sign = c(-1,1), + symbol = c("-","+"), + col = c(2,1))) |> + dplyr::select(YEAR, diff, symbol, z, col) |> + dplyr::mutate(var = "Cold pool area")) |> + dplyr::mutate(group = YEAR < 2020, + var = factor(var, + levels = c("Bottom temperature", + "Sea surface temperature", + "Cold pool area"))) + +zscore_plot <- ggplot(data = cp_summary, + aes(x = YEAR, + y = z, + group = group)) + + geom_hline(yintercept = c(0), linetype = 1) + + geom_hline(yintercept = c(-1,1), linetype = 2) + + geom_hline(yintercept = c(-2,2), linetype = 3) + + geom_point() + + geom_line() + + geom_text(data = cp_summary, + aes(x = YEAR, y = 2.5, label = symbol, color = factor(col))) + + facet_wrap(~var, nrow = 3) + + scale_x_continuous(name = "Year") + + scale_y_continuous(name = "Anomaly") + + scale_color_manual(values = c("blue", "red")) + + theme_bw() + + theme(axis.text = element_text(color = "black"), + axis.ticks = element_line(color = "black"), + panel.border = element_rect(color = "black", fill = NA), + panel.background = element_rect(color = "black", fill = NA), + strip.text = element_text(size = 9, + color = "white", + face = "bold", + margin = margin(0.5, 0, 0.5, 0, "mm")), + strip.background = element_rect(fill = "#0055a4", + color = NA), + legend.position = "none") + +ragg::agg_png(file = here::here("plots", paste0(max_year, "_anomaly.png")), width = 6, height = 6, units = "in", res = fig_res) +print(zscore_plot) +dev.off() +``` + +```{r maps_by_year, message=FALSE, warning=FALSE, include=FALSE} +year_vec <- c(1982:2019, 2021:2023) + +nbs_years <- c(2010, 2017, 2019, 2021:2023) + +temp_breaks <- c(-Inf, seq(-1,8,1), Inf) +color_pal <- "H" +fig_res <- 300 + +dir.create(here::here("plots", "annual_bt")) + +sebs_layers <- akgfmaps::get_base_layers(select.region = "sebs", + set.crs = coldpool:::ebs_proj_crs) + +nbs_layers <- akgfmaps::get_base_layers(select.region = "ebs", + set.crs = coldpool:::ebs_proj_crs, use.survey.bathymetry = TRUE) + +bt_raster_sebs <- terra::rast(coldpool::ebs_bottom_temperature) + +bt_raster_nbs <- terra::rast(coldpool::nbs_ebs_bottom_temperature) + +bt_raster_2018 <- terra::mask(bt_raster_nbs[[names(bt_raster_nbs) == 2018]], + dplyr::filter(nbs_layers$survey.grid, + STATIONID %in% c("V-01", "U-01", "T-01", "S-01", "R-01", + "V-02", "U-02", "T-02", "S-02", "R-02", + "DD-03", "ZZ-03", "Y-03", "X-03", "W-03", "V-03", "U-03", "T-03", "S-03", "R-03", + "DD-04", "CC-04", "BB-04", "AA-04", "ZZ-04", "Y-04", "X-04", "W-04", "V-04", "U-04", "T-04", "S-04", "R-04", + "DD-05", "CC-05", "BB-05", "AA-05", "ZZ-05", "Y-05", "X-05", "W-05", "V-05", "U-05", "T-05", "S-05", "R-05", + "DD-06", "CC-06", "BB-06", "AA-06", "ZZ-06", "Y-06", "X-06", "W-06", "V-06", "U-06", "T-06", "S-06", "R-06", + "DD-07", "CC-07", "BB-07", "AA-07", "ZZ-07", "Y-07", "X-07", "W-07", "V-07", "U-07", "T-07", "S-07", "R-07", + "DD-08", "CC-08", "BB-08", "AA-08", "ZZ-08", "Y-08", "X-08", "W-08", "V-08", "U-08", "T-08", "S-08", "R-08", + "DD-09", "CC-09", "BB-09", "AA-09", "ZZ-09", "Y-09", "X-09", "W-09", "V-09", "U-09", "T-09", "S-09", "R-09", + "DD-10", "CC-10", "BB-10", "AA-10", "ZZ-10", "Y-10", "X-10", "W-10", "V-10", "U-10", "T-10", "S-10", "R-10")), + inverse = TRUE, + touches = TRUE) + + + + +for(ii in 1:length(year_vec)) { + + if(year_vec[ii] == 2018) { + sel_raster <- bt_raster_2018 + mask_layer <- nbs_layers$survey.area + } else { + if(year_vec[ii] %in% nbs_years) { + sel_raster <- bt_raster_nbs + mask_layer <- nbs_layers$survey.area + } else { + sel_raster <- bt_raster_sebs + mask_layer <- sebs_layers$survey.area + } + + } + + bt_df <- as.data.frame(sel_raster[[names(sel_raster) == year_vec[ii]]], + xy = TRUE, + na.rm = FALSE) |> + tidyr::pivot_longer(cols = 3) |> + sf::st_as_sf(coords = c("x", "y"), + crs = coldpool:::ebs_proj_crs) |> + dplyr::rename(year = name, + temperature = value) |> + stars::st_rasterize() + + bt_df$temperature <- cut(bt_df$temperature, + breaks = temp_breaks) + + bt_df <- bt_df |> + sf::st_as_sf() |> + dplyr::group_by(temperature) |> + dplyr::summarise(n = n()) |> + dplyr::select(-n) |> + dplyr::ungroup() |> + sf::st_intersection(mask_layer) + + bt_df$year <- year_vec[ii] + + if(ii == 1) { + bt_year_df <- bt_df + } else { + bt_year_df <- dplyr::bind_rows(bt_year_df, bt_df) + } + +} + +temp_map_cbar <- coldpool::legend_discrete_cbar(breaks = temp_breaks, + colors = viridis::viridis_pal(option = color_pal)(length(temp_breaks)-1), + legend_direction = "horizontal", + font_size = 3, + width = 0.1, + expand_size.x = 0.3, + expand_size.y = 0.3, + expand.x = 0.3, + expand.y = 0.9, + spacing_scaling = 1, + text.hjust = 0.5, + font.family = "sans", + neat.labels = FALSE) + + annotate("text", + x = 1.15, + y = 3.5, + label = expression(bold("Bottom Temperature"~(degree*C))), + size = rel(3.2)) + + theme(plot.margin = unit(c(0,0, 0, 5), units = "mm")) + +for(ii in 1:length(year_vec)) { + + sel_year <- dplyr::filter(bt_year_df, year == year_vec[ii]) + + temp_map <- ggplot() + + ggplot2::geom_sf(data = nbs_layers$akland, + fill = "grey70", + color = "black") + + ggplot2::geom_sf(data = sel_year, + mapping = aes(fill = temperature), + color = NA) + + ggplot2::geom_sf(data = nbs_layers$bathymetry) + + ggplot2::geom_sf(data = nbs_layers$survey.area, + fill = NA, + color = "black") + + ggplot2::geom_sf(data = nbs_layers$graticule, + alpha = 0.3) + + ggplot2::coord_sf(xlim = nbs_layers$plot.boundary$x, + ylim = nbs_layers$plot.boundary$y) + + ggplot2::scale_x_continuous(name = "Longitude", + breaks = nbs_layers$lon.breaks) + + ggplot2::scale_y_continuous(name = "Latitude", + breaks = nbs_layers$lat.breaks) + + facet_wrap(~year, ncol = 4) + + ggplot2::scale_fill_manual(values = viridis_pal(option = color_pal)(length(temp_breaks)-1), + na.value = NA, + drop = FALSE) + + coldpool::theme_multi_map_blue_strip() + + theme(legend.position = "none", + plot.margin = unit(c(5,5,-5,5), units = "mm"), + axis.title = element_blank(), + axis.text = element_text(size = 9)) + + temp_map_grid <- cowplot::plot_grid(temp_map, + temp_map_cbar, + nrow = 2, + rel_heights = c(0.8,0.2)) + + ragg::agg_png(filename = here::here("plots", "annual_bt", paste0(year_vec[ii], "_ebs_bt_map.png")), + width = 6, height = 6, units = "in", res = fig_res) + print(temp_map_grid) + dev.off() + + +} +``` + +Contributed by Sean Rohan^1^ and Lewis Barnett^1^ +^1^ Resource Assessment and Conservation Engineering Division, Alaska Fisheries Science Center, National Marine Fisheries Service, NOAA +**Contact**: sean.rohan@noaa.gov +**Last updated**: September 2023 + +```{r fig.height=3,fig.width=6,fig.cap="\\label{fig:figs}Figure 1. Area of the cold pool in the eastern Bering Sea (EBS) shelf bottom trawl survey area, as measured using observations from the EBS bottom trawl survey (including northwest strata 82 and 90) from 1982–2022. Dashed line denotes the grand mean of the time series and dotted lines show ±1 standard deviation.", message=FALSE, warning=FALSE, echo=FALSE} +print(plot_cpi_timeseries) +``` + +Summer SST and Bottom Temperatures +Contributed by Sean Rohan, sean.rohan@noaa.gov, and Lewis Barnett, lewis.barnett@noaa.gov +Mean surface and bottom temperatures are calculated from spatially interpolated data collected during AFSC summer bottom trawl surveys of the EBS shelf (1982-2023, except 2020) and NBS (2010, 2017–2019, 2021–2023). Temperature data are not adjusted for effects of seasonal heating. Temperature data are interpolated using ordinary kriging with Stein's parameterization of the Matern semivariogram model (Rohan et al., 2022). Code, figures, and data products presented in this contribution are provided in the coldpool R package [https://github.com/afsc-gap-products/coldpool](https://github.com/afsc-gap-products/coldpool). + +In the EBS, the mean surface temperature (6.34°C) was near the time series average (6.75°C) and 1.12°C colder than in 2022. The 2023 mean bottom temperature in the EBS (2.28°C) was near the time series mean of 2.49°C and 0.28°C colder than the mean bottom temperature in 2022 (Figure 24). The near-average bottom temperatures in 2022 and 2023 are a departure from extremely warm conditions in 2016-2021 that had four of the five warmest years in the times series. In the NBS, the mean surface temperature (8.05oC) was slightly below the time series average (9.18oC) and the mean bottom temperature (3.92oC) was near the time series average (3.94oC). However, the time series for the NBS is extremely short compared to the EBS. + +In 2023, bottom temperatures $\leq$ -1°C were observed south of St. Matthew Island for the first time since 2015 (Figure 25). The average bottom temperature in the inner domain of the EBS survey area (2.17°C) was the coldest observed since 2013 (1.64°C). The coldest bottom temperatures ($\leq$ -1°C) within the combined EBS shelf and NBS survey areas were in the middle shelf (between 50 and 100 m isobaths), extending from south of St. Matthew Island at ~61.5°N to the U.S.-Russia maritime boundary. This area of cold water was considerably larger than in 2019 and 2021, when bottom temperatures $\leq$ 0°C were confined to a small area along the U.S.-Russia Convention Line. + +The warmest bottom temperatures were along the coast of the Alaska mainland between Nunivak Island and Norton Sound. However, the area north of Nunivak Island at 60.5°N is sampled at the end of the survey and reflects seasonal warming since sampling occurs 35-45 days later than in the area directly south. + + +Cold Pool Extent - AFSC Bottom Trawl Survey +Contributed by Sean Rohan, sean.rohan@noaa gov, and Lewis Barnett, lewis.barnett@noaa gov +The cold pool extent is calculated from spatially interpolated bottom temperature data collected during AFSC summer bottom trawl surveys of the EBS shelf (1982-2023, except 2020). See 'Summer SST and Bottom Temperatures' contribution above for more details. + +The spatial footprint of the cold pool in 2023 was similar to the most recent near-average years in 2011, 2017, and 2022 (Figure 33). North of ∼57.5°N, the cold pool covered nearly the entire middle domain of the survey area between the 50m and 100m isobaths. The extents of the $\leq$ -1°C (26,550 km^2^) and $\leq$ 0°C (62,400 km^2^) isotherms were larger than they have been since the 2015 survey. The extent of the $\leq$ 1°C isotherm (110,875 km^2^) was the largest it’s been since 2013. The extents of the $\leq$ -1°C, $\leq$ 0°C, and $\leq$ 1°C isotherms were all larger than their time series averages of 23,579 km^2^, 54,158 km^2^, and 102,906 km^2^, respectively. + + +```{r fig.cap="\\label{fig:figs}Figure 2. Cold pool extent in the eastern Bering Sea (EBS), as measured using observations from the EBS bottom trawl survey. Upper panels: Maps of cold pool extent in the EBS shelf survey area from 2002–2021. Lower panel: Extent of the cold pool in proportion to the total EBS shelf survey area from 1982–2022. Fill colors denote bottom temperatures $\\leq$ 2°C, $\\leq$ 1°C, $\\leq$ 0°C, and $\\leq$ -1°C.", fig.height=8, fig.width=6, message=FALSE, warning=FALSE, echo=FALSE} +print(coldpool_with_area) +``` + + +```{r fig.height=3,fig.width=6,fig.cap="\\label{fig:figs}Figure 3. Average summer surface (green triangles) and bottom (blue circles) temperatures (°C) on the eastern Bering Sea (EBS) shelf based on data collected during standardized summer bottom trawl surveys from 1982–2022. Dashed lines represent the time series mean.", message=FALSE, warning=FALSE, echo=FALSE} +print(plot_sebs_average_temperature) +``` + +```{r fig.height=6,fig.width=6,fig.cap="\\label{fig:figs}Figure 4. Contour maps of bottom temperatures from the 2018, 2019, 2021, and 2022 eastern Bering Sea shelf and northern Bering Sea bottom trawl surveys.", message=FALSE, warning=FALSE, echo=FALSE} +print(ebs_nbs_bt_map_grid) +``` diff --git a/DESCRIPTION b/DESCRIPTION index 21b8c06..39c912a 100644 --- a/DESCRIPTION +++ b/DESCRIPTION @@ -25,7 +25,7 @@ Description: This package calculates the area of the cold pool in the eastern Be License: GPL (>=2) Encoding: UTF-8 LazyData: false -RoxygenNote: 7.2.3 +RoxygenNote: 7.3.1 Imports: colorspace, viridis, raster, diff --git a/NAMESPACE b/NAMESPACE index df18b4f..0fb1491 100644 --- a/NAMESPACE +++ b/NAMESPACE @@ -29,4 +29,5 @@ export(sql_to_rqry) export(theme_multi_map) export(theme_multi_map_blue_strip) export(theme_tm_no_legend) +export(vgm_fn) import(raster) diff --git a/NEWS b/NEWS index ece04a1..f571323 100644 --- a/NEWS +++ b/NEWS @@ -1,4 +1,18 @@ -coldpool 3.3-1 (February 23, 2023) +coldpool 3.4-1 (August 22, 2024) +---------------------------------------------------------------- + +NEW FEATURES + +- Added temperature isotherm extent as built-in data sets for + the NBS (see ?nbs_mean_temperature). + + +DATA UPDATE + +- Update with 2024 survey data. + + +coldpool 3.3-1 (February 23, 2024) ---------------------------------------------------------------- NEW FEATURES diff --git a/R/data.R b/R/data.R index c3eccf8..70e734f 100644 --- a/R/data.R +++ b/R/data.R @@ -5,11 +5,11 @@ #' @format A data frame with 39 rows and 9 columns. #' \describe{ #' \item{YEAR}{Year} -#' \item{AREA_LTE2_KM2}{Cold Pool Index. Total area with bottom temperatures less than or equal to 2 celsius, in square kilometers} -#' \item{AREA_LTE1_KM2}{Total area with bottom temperatures less than or equal to 1 celsius, in square kilometers} -#' \item{AREA_LTE0_KM2}{Total area with bottom temperatures less than or equal to 0 celsius, in square kilometers} -#' \item{AREA_LTEMINUS1_KM2}{Total area with bottom temperatures less than or equal to -1 celsius, in square kilometers} -#' \item{MEAN_GEAR_TEMPERATURE}{Mean gear temperature (i.e. bottom temperature) in the survey area.} +#' \item{AREA_LTE2_KM2}{Cold Pool Index. Total area with bottom temperatures less than or equal to 2 celsius, in square kilometers, in the EBS shelf survey area.} +#' \item{AREA_LTE1_KM2}{Total area with bottom temperatures less than or equal to 1 celsius, in square kilometers, in the EBS shelf survey area.} +#' \item{AREA_LTE0_KM2}{Total area with bottom temperatures less than or equal to 0 celsius, in square kilometers, in the EBS shelf survey area.} +#' \item{AREA_LTEMINUS1_KM2}{Total area with bottom temperatures less than or equal to -1 celsius, in square kilometers, in the EBS shelf survey area.} +#' \item{MEAN_GEAR_TEMPERATURE}{Mean gear temperature (i.e. bottom temperature) in the EBS shelf survey area.} #' \item{MEAN_SURFACE_TEMPERATURE}{Mean sea surface temperature in the survey area.} #' \item{MEAN_BT_LT100M}{Mean gear temperature (i.e. bottom temperature) for EBS shelf *STANDARD* strata (i.e., excluding northwest strata 82 and 90) with bottom depth less than 100 m (strata 10, 20, 31, 32, 41, 42, 43).} #' \item{LAST_UPDATE}{Date when cold pool index and temperature rasters were last updated.} @@ -25,8 +25,12 @@ #' @format A data frame with 4 rows and 4 columns. #' \describe{ #' \item{YEAR}{Year} -#' \item{MEAN_GEAR_TEMPERATURE}{Mean gear temperature (i.e. bottom temperature) in the survey area.} -#' \item{MEAN_SURFACE_TEMPERATURE}{Mean sea surface temperature in the survey area.} +#' \item{MEAN_GEAR_TEMPERATURE}{Mean gear temperature (i.e. bottom temperature) in the NBS survey area.} +#' \item{MEAN_SURFACE_TEMPERATURE}{Mean sea surface temperature in the NBS survey area.} +#' \item{AREA_LTE2_KM2}{Total area with bottom temperatures less than or equal to 2 celsius, in square kilometers, in the NBS survey area.} +#' \item{AREA_LTE1_KM2}{Total area with bottom temperatures less than or equal to 1 celsius, in square kilometers, in the NBS survey area.} +#' \item{AREA_LTE0_KM2}{Total area with bottom temperatures less than or equal to 0 celsius, in square kilometers, in the NBS survey area.} +#' \item{AREA_LTEMINUS1_KM2}{Total area with bottom temperatures less than or equal to -1 celsius, in square kilometers, in the NBS survey area.} #' \item{LAST_UPDATE}{Date when cold pool index and temperature rasters were last updated.} #' } #' @source \url{https://www.fisheries.noaa.gov/contact/groundfish-assessment-program} diff --git a/R/sysdata.rda b/R/sysdata.rda index 7422e91..54fdb96 100644 Binary files a/R/sysdata.rda and b/R/sysdata.rda differ diff --git a/R/vgm_fn.R b/R/vgm_fn.R new file mode 100644 index 0000000..26b890f --- /dev/null +++ b/R/vgm_fn.R @@ -0,0 +1,121 @@ +#' Variogram function +#' +#' R implementation of gstat variogram functions. +#' +#' @param model gstat model type. Currenty implemented: "Exp", "Sph", "Cir", "Gau", "Mat", "Bes", "Ste" +#' @param dist Distance (h) +#' @param range Range parameter of the variogram model. +#' @param psill Partial sill of the variogram model. +#' @param nugget Nugget parameter of the variogram model (default = 0) +#' @param kappa Kappa parameter for Matern class variogram models (default = 0.5) +#' @export + +vgm_fn <- function(model, dist, range, psill, nugget = 0, kappa = 0.5, ...) { + + args <- as.list(match.call()[-1]) + + switch(model, + "Exp" = do.call(coldpool:::exp_vgm, args = args), + "Sph" = do.call(coldpool:::sph_vgm, args = args), + "Cir" = do.call(coldpool:::cir_vgm, args = args), + "Gau" = do.call(coldpool:::gau_vgm, args = args), + "Mat" = do.call(coldpool:::mat_vgm, args = args), + "Bes" = do.call(coldpool:::bes_vgm, args = args), + "Ste" = do.call(coldpool:::ste_vgm, args = args) + ) + +} + +#' Exponential variogram +#' @noRd + +exp_vgm <- function(nugget = 0, psill, range, dist, a = 1, ...) { + a <- range * a + return(nugget + psill *(1-exp(-1*dist/a))) +} + +#' Spherical variogram +#' @noRd + +sph_vgm <- function(nugget = 0, psill, range, dist, a = 1, ...) { + a <- range*a + val <- numeric(length = length(dist)) + val[dist > a] <- nugget + psill + val[dist <= a] <- nugget + psill * (1.5*dist[dist <= a]/a - 0.5 * (dist[dist <= a]/a)^3) + return(val) + +} + +#' Circular variogram +#' @noRd + +cir_vgm <- function(nugget = 0, psill, range, dist, a = 1, ...) { + a <- range*a + val <- numeric(length = length(dist)) + val[dist > a] <- nugget + psill + val[dist <= a] <- nugget + psill * ((2*dist[dist <= a])/(pi*a) * sqrt(1-(dist[dist <= a]/a)^2)+(2/pi)*asin(dist[dist <= a]/a)) + return(val) +} + +#' Gaussian variogram +#' @noRd + +gau_vgm <- function(nugget = 0, psill, range, dist, a = 1, ...) { + a <- range*a + return(nugget + psill*(1-exp(-(dist/a)^2))) +} + +#' Matern variogram +#' @noRd + +mat_vgm <- function(nugget = 0, psill, dist, range, kappa = 0.5, ...) { + + dist <- dist/range + + if(kappa == .5) { + return(nugget+psill*exp(-dist)) + } + if(kappa == 1.5) { + return(nugget+psill*(1+dist)*exp(-dist)) + } + if(kappa == 2.5) { + return(nugget+psill*(1+dist+dist^2/3)*exp(-dist)) + } + + con <- 1/(2^(kappa - 1)) * gamma(kappa) + + dist[dist == 0] <- 1e-10 + + return(nugget + psill * con * (dist^kappa) * besselK(x = dist, nu = kappa)) +} + +#' Bessel variogram +#' @noRd + +bes_vgm <- function(nugget = 0, psill, range, dist, a = 1, ...) { + a <- range*a + + dist[dist == 0] <- 1e-10 + val <- nugget + psill*(1-dist/a*besselK(x = dist/a, nu = 1)) + + return(val) + +} + +#' Stein's Matern variogram +#' @noRd + +ste_vgm <- function(nugget = 0, dist, range, kappa, a = 1, ...) { + + a <- range/a + + matern <- besselK(x = 2 * kappa^(1/2) * dist / a, nu = kappa) + multipl <- 1 / (2^(kappa - 1) * gamma(kappa))*(2 * kappa^(1/2) * dist/a)^kappa + val <- ifelse(matern == 0 | !is.finite(multipl), + 0, + ifelse(!is.finite(matern), + 1, + multipl*matern)) + + return(nugget + val) +} \ No newline at end of file diff --git a/analysis/resample_probability/fit_col1516_temp.png b/analysis/resample_probability/fit_col1516_temp.png new file mode 100644 index 0000000..31f330a Binary files /dev/null and b/analysis/resample_probability/fit_col1516_temp.png differ diff --git a/analysis/resample_probability/fit_cpa.png b/analysis/resample_probability/fit_cpa.png new file mode 100644 index 0000000..93e2ecc Binary files /dev/null and b/analysis/resample_probability/fit_cpa.png differ diff --git a/analysis/resample_probability/resample_prob.R b/analysis/resample_probability/resample_prob.R new file mode 100644 index 0000000..01cd705 --- /dev/null +++ b/analysis/resample_probability/resample_prob.R @@ -0,0 +1,176 @@ + +library(coldpool) +library(akgfmaps) +library(mgcv) + +channel <- coldpool::get_connected(schema = "AFSC") + +index_hauls <- RODBC::sqlQuery(channel = channel, + query = "select * from racebase.haul + where haul_type in (3, 17) + and region = 'BS' + and cruise > 199900") |> + dplyr::filter(STATIONID %in% akgfmaps::get_survey_stations(select.region = "sebs")) |> + dplyr::mutate(YEAR = floor(CRUISE/100)) + +bristol_bay_stns <- dplyr::bind_rows( + index_hauls[grepl(pattern = 16, x = index_hauls$STATIONID), ], + index_hauls[grepl(pattern = 15, x = index_hauls$STATIONID), ] +) |> + dplyr::group_by(YEAR) |> + dplyr::summarise(MEAN_CORE_BT = mean(GEAR_TEMPERATURE, na.rm = TRUE)) + +resample_years <- index_hauls |> + dplyr::group_by(YEAR, HAUL_TYPE) |> + dplyr::summarise(n = n()) |> + dplyr::ungroup() |> + tidyr::pivot_wider(id_cols = "YEAR", + names_from = "HAUL_TYPE", + values_from = n, + values_fill = 0) |> + dplyr::mutate(RESAMPLE = `17` > 0) |> + dplyr::inner_join(coldpool::cold_pool_index) |> + dplyr::inner_join(bristol_bay_stns) + + +mod_resample1 <- mgcv::gam(formula = RESAMPLE ~ s(AREA_LTE2_KM2, bs = "tp", k = 5), + family = binomial(), + data = resample_years) + +mod_resample2 <- mgcv::gam(formula = RESAMPLE ~ s(MEAN_CORE_BT, bs = "tp", k = 5), + family = binomial(), + data = resample_years) + +mod_summary1 <- summary(mod_resample1) +mod_summary1$dev.expl +mod_summary2 <- summary(mod_resample2) +mod_summary2$dev.expl + +gam.check(mod_resample1) +gam.check(mod_resample2) + +resample_years$fit_1 <- predict(mod_resample1, type = "response") +resample_years$fit_2 <- predict(mod_resample2, type = "response") + +fit1 <- data.frame(AREA_LTE2_KM2 = + seq(min(resample_years$AREA_LTE2_KM2), + max(resample_years$AREA_LTE2_KM2), + by = 5000)) + +fit1$mean <- predict(mod_resample1, + newdata = fit1) + +fit1$se <- predict(mod_resample1, + newdata = fit1, + se.fit = TRUE)$se.fit + +fit2 <- data.frame(MEAN_CORE_BT = + seq(min(resample_years$MEAN_CORE_BT), + max(resample_years$MEAN_CORE_BT), + by = 0.1)) + +fit2$mean <- predict(mod_resample2, + newdata = fit2) + +fit2$se <- predict(mod_resample2, + newdata = fit2, + se.fit = TRUE)$se.fit + +inv_logit <- function(x) { + exp(x)/(1+exp(x)) +} + + +ragg::agg_png(here::here("analysis", "resample_probability", "fit_cpa.png"), width = 6, height = 4, units = "in", res = 300) +print( +ggplot() + + geom_ribbon(data = fit1, + mapping = aes(x = AREA_LTE2_KM2, + ymin = inv_logit(mean-se), + ymax = inv_logit(mean+se)), + alpha = 0.3) + + geom_path(data = fit1, + mapping = aes(x = AREA_LTE2_KM2, + y = inv_logit(mean))) + + geom_point(data = resample_years, + mapping = aes(x = AREA_LTE2_KM2, + y = as.numeric(RESAMPLE), + color = RESAMPLE)) + + scale_color_manual(name = "Resampled?", + values = c("TRUE" = "#E69F00", "FALSE" = "black")) + + scale_x_continuous(name = expression('Cold Pool Area ('*km^2*')')) + + scale_y_continuous(name = "Resample Probability (fit)") + + ggtitle(label = paste0("Predictor = Cold pool area (km^2)\nDeviance explained: ", + round(mod_summary1$dev.expl*100, 1), "%")) + + theme_bw() +) +dev.off() + + +ragg::agg_png(here::here("analysis", "resample_probability", "fit_col1516_temp.png"), width = 6, height = 4, units = "in", res = 300) +print( +ggplot() + + geom_ribbon(data = fit2, + mapping = aes(x = MEAN_CORE_BT, + ymin = inv_logit(mean-se), + ymax = inv_logit(mean+se)), + alpha = 0.3) + + geom_path(data = fit2, + mapping = aes(x = MEAN_CORE_BT, + y = inv_logit(mean))) + + geom_point(data = resample_years, + mapping = aes(x = MEAN_CORE_BT, + y = as.numeric(RESAMPLE), + color = RESAMPLE)) + + scale_color_manual(name = "Resampled?", + values = c("TRUE" = "#E69F00", "FALSE" = "black")) + + scale_x_continuous(name = expression('Mean bottom temperature in columns 15-16 ('*degree*C*')')) + + scale_y_continuous(name = "Resample Probability (fit)") + + ggtitle(label = paste0("Predictor = Mean bottom temperature for stations in columns 15-16\nDeviance explained: ", + round(mod_summary2$dev.expl*100, 1), "%")) + + theme_bw() +) +dev.off() + + +ragg::agg_png(here::here("analysis", "resample_probability", "timeseries_cpa.png"), width = 6, height = 4, units = "in", res = 300) +print( +ggplot() + + geom_path(data = resample_years, + mapping = aes(x = YEAR, + y = fit_1)) + + geom_point(data = resample_years, + mapping = aes(x = YEAR, + y = fit_1, + color = RESAMPLE)) + + scale_color_manual(name = "Resampled?", + values = c("TRUE" = "#E69F00", "FALSE" = "black")) + + scale_x_continuous(name = "Year") + + scale_y_continuous(name = "Resample Probability (fit)") + + ggtitle(label = paste0("Predictor = Cold pool area (km^2)\nDeviance explained: ", + round(mod_summary1$dev.expl*100, 1), "%")) + + theme_bw() +) +dev.off() + + +ragg::agg_png(here::here("analysis", "resample_probability", "timeseries_col1516_temp.png"), width = 6, height = 4, units = "in", res = 300) +print( +ggplot() + + geom_path(data = resample_years, + mapping = aes(x = YEAR, + y = fit_2)) + + geom_point(data = resample_years, + mapping = aes(x = YEAR, + y = fit_2, + color = RESAMPLE)) + + scale_color_manual(name = "Resampled?", + values = c("TRUE" = "#E69F00", "FALSE" = "black")) + + scale_x_continuous(name = "Year") + + scale_y_continuous(name = "Resample Probability (fit)") + + ggtitle(label = paste0("Predictor = Mean bottom temperature for stations in columns 15-16\nDeviance explained: ", + round(mod_summary2$dev.expl*100, 1), "%")) + + theme_bw() +) +dev.off() + diff --git a/analysis/resample_probability/timeseries_col1516_temp.png b/analysis/resample_probability/timeseries_col1516_temp.png new file mode 100644 index 0000000..387b439 Binary files /dev/null and b/analysis/resample_probability/timeseries_col1516_temp.png differ diff --git a/analysis/resample_probability/timeseries_cpa.png b/analysis/resample_probability/timeseries_cpa.png new file mode 100644 index 0000000..b8992a1 Binary files /dev/null and b/analysis/resample_probability/timeseries_cpa.png differ diff --git a/analysis/temp3d/R/01_get_data.R b/analysis/temp3d/R/01_get_data.R index ec3f135..4bb96d0 100644 --- a/analysis/temp3d/R/01_get_data.R +++ b/analysis/temp3d/R/01_get_data.R @@ -40,7 +40,8 @@ get_data_temp3d <- function() { survey_definition_ids[ii] ) ) |> - dplyr::mutate(DATE_TIME = lubridate::with_tz(lubridate::force_tz(DATE_TIME, tzone = "UTC"), tzone = "America/Anchorage")) |> + dplyr::mutate(DATE_TIME = lubridate::with_tz(lubridate::force_tz(DATE_TIME, tzone = "UTC"), tzone = "America/Anchorage"), + HAUL_ID = paste0(VESSEL, CRUISE, HAUL)) |> dplyr::inner_join(event_names, by = "EVENT_TYPE_ID") |> dplyr::select(-EVENT_TYPE_ID) |> tidyr::pivot_wider(values_from = "DATE_TIME", names_from = "EVENT_NAME") @@ -71,7 +72,7 @@ get_data_temp3d <- function() { temp_depth <- RODBC::sqlQuery( channel = channel, query = paste0( - "select bt.temperature, bt.depth, bt.date_time, h.haul_id + "select bt.temperature, bt.depth, bt.date_time, h.haul, c.vessel_id vessel, c.cruise from race_data.bathythermics bt, race_data.bathythermic_headers bth, race_data.hauls h, race_data.cruises c, race_data.surveys s where bth.haul_id = h.haul_id @@ -84,11 +85,41 @@ get_data_temp3d <- function() { and s.survey_definition_id = ", survey_definition_ids[ii] ) - ) |> dplyr::mutate(DATE_TIME = lubridate::with_tz(lubridate::force_tz(DATE_TIME, tzone = "UTC"), tzone = "America/Anchorage")) + ) |> dplyr::mutate(DATE_TIME = lubridate::with_tz(lubridate::force_tz(DATE_TIME, tzone = "UTC"), tzone = "America/Anchorage"), + HAUL_ID = paste0(VESSEL, CRUISE, HAUL)) |> + dplyr::select(-VESSEL, -CRUISE, -HAUL) + + temp_depth_rb2 <- RODBC::sqlQuery(channel = channel, + query = paste0( + "select bt.vessel, bt.cruise, bt.haul, bt.date_time, + bt.temperature, bt.depth + from race_edit.rb2_btd bt, + racebase.haul h, + race_data.cruises c, + race_data.surveys s + where bt.vessel = h.vessel + and h.vessel = c.vessel_id + and h.cruise = c.cruise + and bt.cruise = h.cruise + and bt.haul = h.haul + and bt.depth > 0.1 + and bt.temperature > -2.0 + and bt.temperature < 20 + and s.survey_id = c.survey_id + and s.survey_definition_id = ", survey_definition_ids[ii])) + + temp_depth_rb2 <- hauls |> + dplyr::select(HAUL_ID) |> + dplyr::inner_join(temp_depth_rb2) |> + dplyr::mutate(HAUL_ID = paste0(VESSEL, CRUISE, HAUL)) |> + dplyr::select(-VESSEL, -CRUISE, -HAUL) temp_depth <- dplyr::filter(temp_depth, HAUL_ID %in% unique(hauls$HAUL_ID)) + hauls <- dplyr::filter(hauls, HAUL_ID %in% unique(temp_depth$HAUL_ID)) + temp_depth <- dplyr::bind_rows(temp_depth, temp_depth_rb2) + unique_haul_id <- sort(unique(temp_depth$HAUL_ID)) profile_dat <- data.frame() diff --git a/analysis/temp3d/R/test_expansion_estimation.R b/analysis/temp3d/R/test_expansion_estimation.R index 33aa8f4..956055e 100644 --- a/analysis/temp3d/R/test_expansion_estimation.R +++ b/analysis/temp3d/R/test_expansion_estimation.R @@ -22,6 +22,8 @@ unique_years <- sort(unique(profile_dat$YEAR)) cv_fits <- data.frame() ii <- 1 + +with(ii, mean()) sel_profile <- dplyr::filter(profile_dat, YEAR == unique_years[ii]) #|> @@ -32,14 +34,8 @@ ii <- 1 location_formula = ~ LONGITUDE + LATITUDE + DEPTH nm = Inf maxdist = Inf - -# mod_idw <- gstat::gstat(formula = kriging_formula, -# locations = ~ LONGITUDE + LATITUDE, -# data = dplyr::filter(x, CAST == "bottom"), -# set = list(idp = 2), -# nmax = Inf) -# -# vgm_mod <- gstat::variogram(mod_idw) + + mod_vertical <- gstat::gstat(formula = kriging_formula, locations = location_formula, @@ -82,80 +78,97 @@ mod <- gstat::gstat(formula = kriging_formula, maxdist = maxdist, model = fit_vg_vertical) +vgm_fn <- function(range, psill, nugget, dist, model) { + + sel_fn <- switch(model, + "Exp" = coldpool::exp_vgm, + "Sph" = coldpool::sph_vgm, + "Cir" = coldpool::cir_vgm, + "Gau" = coldpool::gau_vgm, + "Mat" = coldpool::mat_vgm, + "Bes" = coldpool::bes_vgm, + "Ste" = coldpool::ste_vgm + ) + + return(out) +} + +exp_vgm <- function(nugget = 0, psill, range, dist, a = 1) { + a <- range * a + return(nugget + psill *(1-exp(-1*dist/a))) +} -optim_exp_z <- function(z_start, kriging_formula, location_formula, anis = c(0,0,0,1,1), nmax, maxdist, data, model = "Exp") { +sph_vgm <- function(nugget = 0, psill, range, dist, a = 1) { + a <- range*a + val <- numeric(length = length(dist)) + val[dist > a] <- nugget + psill + val[dist <= a] <- nugget + psill * (1.5*dist[dist <= a]/a - 0.5 * (dist[dist <= a]/a)^3) + return(val) - vgm_fn <- function(range, psill, nugget, dist, model) { - - exp_vgm <- function(nugget = 0, psill, range, dist, a = 1) { - a <- range * a - return(nugget + psill *(1-exp(-1*dist/a))) - } - - sph_vgm <- function(nugget = 0, psill, range, dist, a = 1) { - a <- range*a - val <- numeric(length = length(dist)) - val[dist > a] <- nugget + psill - val[dist <= a] <- nugget + psill * (1.5*dist[dist <= a]/a - 0.5 * (dist[dist <= a]/a)^3) - return(val) - - } - - cir_vgm <- function(nugget = 0, psill, range, dist, a = 1) { - a <- range*a - val <- numeric(length = length(dist)) - val[dist > a] <- nugget + psill - val[dist <= a] <- nugget + psill * ((2*dist[dist <= a])/(pi*a) * sqrt(1-(dist[dist <= a]/a)^2)+(2/pi)*asin(dist[dist <= a]/a)) - return(val) - } +} - - gau_vgm <- function(nugget = 0, psill, range, dist, a = 1) { - a <- range*a - return(nugget + psill*(1-exp(-(dist/a)^2))) - } - - mat_vgm <- function(nugget = 0, psill, dist, range, kappa = 0.5) { - - dist <- dist * 1/range - # call some special cases for half fractions of nu - if( kappa == .5){ - return(nugget+psill*exp(-dist)) - } - if( kappa == 1.5){ - return(nugget+psill*(1+dist)*exp(-dist)) - } - if( kappa == 2.5){ - return(nugget+psill*(1+dist+dist^2/3)*exp(-dist)) - } - - con <- 1/(2^(kappa - 1)) * gamma(kappa) - - dist[dist == 0] <- 1e-10 - - return(nugget + psill * con * (dist^kappa) * besselK(dist, kappa)) - } - - bes_vgm <- function(nugget = 0, psill, range, dist, a = 1) { - - dist[dist == 0] <- 1e-10 - val <- nugget + psill*(1-dist/a*besselK(dist/a, nu = 1)) - - return() - - } - - bes_vgm(nugget = 0.1, psill = 1, range = 2, dist = 0:3) - - sel_fn <- switch(model, - "Exp" = exp_vgm, - "Sph" = sph_vgm, - "Cir" = cir_vgm, - "Gau" = gau_vgm, - ) - - return(out) +cir_vgm <- function(nugget = 0, psill, range, dist, a = 1) { + a <- range*a + val <- numeric(length = length(dist)) + val[dist > a] <- nugget + psill + val[dist <= a] <- nugget + psill * ((2*dist[dist <= a])/(pi*a) * sqrt(1-(dist[dist <= a]/a)^2)+(2/pi)*asin(dist[dist <= a]/a)) + return(val) +} + + +gau_vgm <- function(nugget = 0, psill, range, dist, a = 1) { + a <- range*a + return(nugget + psill*(1-exp(-(dist/a)^2))) +} + +mat_vgm <- function(nugget = 0, psill, dist, range, kappa = 0.5) { + + dist <- dist/range + + if(kappa == .5) { + return(nugget+psill*exp(-dist)) } + if(kappa == 1.5) { + return(nugget+psill*(1+dist)*exp(-dist)) + } + if(kappa == 2.5) { + return(nugget+psill*(1+dist+dist^2/3)*exp(-dist)) + } + + con <- 1/(2^(kappa - 1)) * gamma(kappa) + + dist[dist == 0] <- 1e-10 + + return(nugget + psill * con * (dist^kappa) * besselK(x = dist, nu = kappa)) +} + +bes_vgm <- function(nugget = 0, psill, range, dist, a = 1) { + a <- range*a + + dist[dist == 0] <- 1e-10 + val <- nugget + psill*(1-dist/a*besselK(x = dist/a, nu = 1)) + + return(val) + +} + +ste_vgm <- function(nugget = 0, dist, range, kappa, a = 1) { + + a <- range/a + + matern <- besselK(x = 2 * kappa^(1/2) * dist / a, nu = kappa) + multipl <- 1 / (2^(kappa - 1) * gamma(kappa))*(2 * kappa^(1/2) * dist/a)^kappa + val <- ifelse(matern == 0 | !is.finite(multipl), + 0, + ifelse(!is.finite(matern), + 1, + multipl*matern)) + + return(nugget + val) +} + + +optim_exp_z <- function(z_start, kriging_formula, location_formula, anis = c(0,0,0,1,1), nmax, maxdist, data, model = "Exp") { z_fn <- function(zz, diff --git a/data/ebs_nbs_temperature_full_area.csv b/data/ebs_nbs_temperature_full_area.csv index fead756..30260d8 100644 --- a/data/ebs_nbs_temperature_full_area.csv +++ b/data/ebs_nbs_temperature_full_area.csv @@ -10032,6 +10032,189 @@ -1.4,9.8,"T-24",2010-08-07 18:17:06,81,3,0,201002,68,143,61.337255,-172.904275,2010 -1.2,9.3,"U-23",2010-08-08 07:46:45,81,3,0,201002,60,143,61.66879,-172.290975,2010 -1.3,9.2,"T-23",2010-08-08 11:18:20,81,3,0,201002,61,143,61.330395,-172.15018,2010 +3.7,3.8,"H-16",2011-06-05 09:19:28,10,3,0,201101,32,98,57.3254,-158.42139,2011 +3.6,3.9,"I-16",2011-06-05 12:09:22,10,3,0,201101,36,98,57.67822,-158.364325,2011 +4.4,5.1,"J-16",2011-06-05 14:40:24,10,3,0,201101,35,98,58.018625,-158.318645,2011 +4,4.2,"J-15",2011-06-05 17:27:58,10,3,0,201101,42,98,57.99977,-158.96414,2011 +5.6,6.4,"K-14",2011-06-06 06:30:58,10,3,0,201101,26,98,58.339825,-159.55201,2011 +3.4,3.5,"J-14",2011-06-06 09:08:17,10,3,0,201101,42,98,58.00166,-159.611495,2011 +2.3,2.4,"I-14",2011-06-06 11:40:58,10,3,0,201101,49,98,57.665,-159.637325,2011 +3,3.1,"H-14",2011-06-06 14:15:06,10,3,0,201101,56,98,57.32956,-159.67317,2011 +3.9,4.2,"G-14",2011-06-06 16:46:32,10,3,0,201101,55,98,57.002925,-159.687325,2011 +4.7,4.9,"F-14",2011-06-07 06:36:42,10,3,0,201101,38,98,56.68835,-159.71041,2011 +3.9,4.3,"F-13",2011-06-07 09:27:45,31,3,0,201101,58,98,56.657695,-160.386375,2011 +3.9,4.5,"E-12",2011-06-07 14:54:41,10,3,0,201101,53,98,56.338425,-160.9812,2011 +3.3,4.7,"F-12",2011-06-07 17:28:52,31,3,0,201101,67,98,56.670475,-160.982825,2011 +3.2,3.6,"G-12",2011-06-08 06:27:35,31,3,0,201101,67,98,56.998355,-160.9434,2011 +2.7,2.8,"H-12",2011-06-08 09:07:11,31,3,0,201101,61,98,57.3318,-160.943115,2011 +2.2,2.3,"I-12",2011-06-08 11:44:58,31,3,0,201101,56,98,57.66769,-160.9007,2011 +2.8,2.7,"J-12",2011-06-08 14:20:22,10,3,0,201101,45,98,58.000825,-160.854765,2011 +4.9,5.1,"K-12",2011-06-08 16:59:00,10,3,0,201101,23,98,58.32182,-160.77504,2011 +2.7,3,"J-10",2011-06-09 06:21:30,10,3,0,201101,37,98,57.987025,-162.102265,2011 +2.3,2.6,"I-10",2011-06-09 08:47:44,10,3,0,201101,46,98,57.653465,-162.133425,2011 +2.3,2.9,"H-10",2011-06-09 11:03:58,10,3,0,201101,51,98,57.351905,-162.13991,2011 +2.3,3,"G-10",2011-06-09 13:41:55,31,3,0,201101,60,98,57.00593,-162.162975,2011 +2.1,3.3,"G-09",2011-06-09 16:20:34,31,3,0,201101,61,98,57.003005,-162.7859,2011 +3,4.6,"F-10",2011-06-10 06:27:33,31,3,0,201101,71,98,56.6619,-162.185875,2011 +2.7,5.2,"E-10",2011-06-10 09:03:54,31,3,0,201101,75,98,56.33111,-162.19315,2011 +3.9,4.5,"D-10",2011-06-10 11:37:11,31,3,0,201101,71,98,56.00302,-162.253435,2011 +4.4,5.5,"C-09",2011-06-10 16:32:52,10,3,0,201101,53,98,55.66759,-162.83745,2011 +4.7,5.7,"B-08",2011-06-11 09:23:58,31,3,0,201101,52,98,55.33541,-163.43236,2011 +3.9,5.9,"B-07",2011-06-11 16:57:17,31,3,0,201101,78,98,55.3408,-164.019675,2011 +2.7,5.1,"E-09",2011-06-12 06:35:45,31,3,0,201101,79,98,56.342565,-162.800835,2011 +2.6,5.4,"E-08",2011-06-12 09:25:06,31,3,0,201101,84,98,56.3338,-163.41599,2011 +1.8,5.4,"F-08",2011-06-12 12:06:52,31,3,3.1,201101,74,98,56.668075,-163.368345,2011 +2,3.9,"G-08",2011-06-12 14:45:52,31,3,0,201101,65,98,57.001925,-163.39286,2011 +2.1,3.4,"H-08",2011-06-12 17:14:17,10,3,0,201101,53,98,57.33856,-163.37324,2011 +3.2,3.2,"K-08",2011-06-13 06:25:14,10,3,0,201101,38,98,58.3411,-163.35971,2011 +3.9,3.9,"L-08",2011-06-13 08:46:18,10,3,0,201101,32,98,58.66605,-163.36031,2011 +4.6,4.6,"M-08",2011-06-13 11:18:24,10,3,0,201101,22,98,58.990615,-163.354575,2011 +5.4,5.5,"N-07",2011-06-13 14:30:27,10,3,0,201101,22,98,59.322005,-164.00498,2011 +3.6,3.6,"M-06",2011-06-14 06:31:17,10,3,0,201101,28,98,59.007975,-164.657395,2011 +3.5,3.6,"L-06",2011-06-14 09:07:59,10,3,0,201101,37,98,58.672435,-164.64874,2011 +2.3,2.5,"K-06",2011-06-14 11:31:55,10,3,0,201101,44,98,58.333425,-164.64246,2011 +2,2.2,"J-06",2011-06-14 13:55:05,10,3,0,201101,44,98,58.004055,-164.61441,2011 +2.2,3,"I-06",2011-06-14 16:27:14,10,3,0,201101,52,98,57.66989,-164.61525,2011 +0.8,3.6,"H-06",2011-06-15 06:26:27,31,3,0,201101,66,98,57.352965,-164.63506,2011 +2,4.5,"G-06",2011-06-15 09:03:39,31,3,0,201101,70,98,56.99777,-164.602055,2011 +2.5,5.3,"F-06",2011-06-15 11:28:44,31,3,0,201101,75,98,56.66538,-164.59178,2011 +2.4,5.7,"E-06",2011-06-15 14:00:28,31,3,0,201101,86,98,56.327805,-164.588475,2011 +2.2,6.3,"D-06",2011-06-15 16:34:44,31,3,0,201101,92,98,55.99676,-164.591725,2011 +2.4,5.4,"F-04",2011-06-16 06:39:29,31,3,0,201101,79,98,56.644215,-165.819575,2011 +1.6,3.9,"G-04",2011-06-16 09:15:18,31,3,0,201101,73,98,56.98431,-165.84926,2011 +0.4,3.8,"H-04",2011-06-16 12:14:09,31,3,0,201101,68,98,57.33043,-165.869225,2011 +0.8,2.8,"I-04",2011-06-16 15:10:57,31,3,0,201101,64,98,57.666025,-165.87991,2011 +2.1,2.7,"J-04",2011-06-16 18:06:34,10,3,0,201101,55,98,58.007805,-165.906625,2011 +2.2,2.2,"K-04",2011-06-17 06:29:19,10,3,0,201101,44,98,58.333865,-165.91866,2011 +2.7,2.7,"L-04",2011-06-17 09:02:32,10,3,0,201101,37,98,58.666715,-165.926125,2011 +3.2,3.2,"M-04",2011-06-17 11:30:38,20,3,0,201101,31,98,59.000325,-165.930295,2011 +4,4.1,"N-04",2011-06-17 13:59:29,20,3,0,201101,25,98,59.329825,-165.95459,2011 +4.8,4.9,"O-04",2011-06-17 16:20:15,20,3,0,201101,27,98,59.618385,-165.93924,2011 +4.2,4.2,"O-02",2011-06-19 06:20:36,20,3,0,201101,31,98,59.66255,-167.279505,2011 +4.1,4.2,"N-02",2011-06-19 08:43:53,20,3,0,201101,32,98,59.33595,-167.260375,2011 +2.6,2.9,"M-02",2011-06-19 11:13:50,20,3,0,201101,40,98,59.0013,-167.22526,2011 +2.4,2.8,"L-02",2011-06-19 13:35:56,20,3,0,201101,44,98,58.675005,-167.220765,2011 +2,2.5,"K-02",2011-06-19 16:01:22,20,3,0,201101,51,98,58.33393,-167.192525,2011 +1.1,3.2,"J-02",2011-06-20 06:33:49,31,3,0,201101,63,98,58.014685,-167.173745,2011 +1.1,3.7,"I-02",2011-06-20 09:12:04,31,3,0,201101,67,98,57.67584,-167.124775,2011 +2.1,3.9,"H-02",2011-06-20 12:06:31,31,3,0,201101,71,98,57.33541,-167.129335,2011 +3.4,5.7,"G-02",2011-06-20 14:37:58,31,3,0,201101,73,98,57.0014,-167.08218,2011 +5.3,6.1,"Z-05",2011-06-24 06:40:36,31,3,0,201101,82,98,54.6765,-165.151985,2011 +5.6,7.1,"A-06",2011-06-24 10:01:18,31,3,0,201101,63,98,55.025205,-164.59065,2011 +4.6,7.2,"B-06",2011-06-24 12:25:49,31,3,0,201101,101,98,55.34436,-164.55195,2011 +3.6,7.7,"C-06",2011-06-24 15:11:47,31,3,0,201101,96,98,55.67614,-164.587965,2011 +2.5,7.6,"E-04",2011-06-25 06:40:01,31,3,0,201101,92,98,56.319815,-165.801725,2011 +3.6,7.6,"D-04",2011-06-25 09:10:52,31,3,0,201101,106,98,56.009195,-165.785035,2011 +4,7.8,"C-04",2011-06-25 11:46:39,50,3,0,201101,117,98,55.667965,-165.803235,2011 +4,8.1,"B-04",2011-06-25 14:20:42,50,3,0,201101,120,98,55.342385,-165.78714,2011 +4.2,7.1,"A-04",2011-06-25 17:02:26,50,3,0,201101,130,98,54.998905,-165.76539,2011 +2.8,6.8,"F-02",2011-06-26 15:29:00,31,3,0,201101,95,98,56.673075,-167.06413,2011 +3,6.6,"F-01",2011-06-26 18:38:32,31,3,0,201101,103,98,56.66125,-167.646925,2011 +3.3,6.9,"E-02",2011-06-26 22:15:05,50,3,0,201101,113,98,56.337275,-167.04085,2011 +3.3,6.3,"F-18",2011-06-27 09:11:55,50,3,0,201101,106,98,56.660865,-168.299065,2011 +3.1,6.3,"GF1918",2011-06-27 11:31:03,32,3,0,201101,96,98,56.833515,-168.623565,2011 +3.4,6.3,"G-18",2011-06-27 13:31:50,32,3,0,201101,81,98,56.991725,-168.342065,2011 +3.5,5.2,"HG1918",2011-06-27 15:42:59,32,3,0,201101,76,98,57.169755,-168.60847,2011 +3.3,5.6,"H-18",2011-06-28 06:43:16,32,3,0,201101,74,98,57.331535,-168.376375,2011 +2.9,5.1,"H-19",2011-06-28 09:29:18,42,3,4.4,201101,70,98,57.33187,-168.98133,2011 +2.1,4.4,"HG2019",2011-06-28 13:08:10,42,3,0,201101,71,98,57.15973,-169.328765,2011 +3.1,5.1,"G-19",2011-06-28 15:42:33,32,3,0,201101,79,98,57.00081,-168.950855,2011 +3.3,4.3,"GF2019",2011-06-28 18:24:55,32,3,0,201101,81,98,56.829005,-169.264115,2011 +3.7,4.2,"HG2120",2011-06-29 06:50:50,42,3,0,201101,50,98,57.165825,-169.8903,2011 +1.7,3.8,"G-20",2011-06-29 09:42:10,42,3,0,201101,60,98,56.994735,-169.546975,2011 +3.7,4.8,"GF2120",2011-06-29 12:18:52,42,3,0,201101,71,98,56.835465,-169.855435,2011 +3.4,3.8,"G-21",2011-06-29 14:41:11,42,3,0,201101,68,98,57.0039,-170.159135,2011 +3.8,4.8,"H-21",2011-07-01 07:10:13,42,3,0,201101,56,98,57.33729,-170.21985,2011 +1.4,4.2,"H-20",2011-07-01 09:40:09,42,3,0,201101,61,98,57.329015,-169.614575,2011 +0.7,4.3,"IH2019",2011-07-01 11:59:06,42,3,0,201101,69,98,57.50109,-169.382925,2011 +3.5,5.2,"IH1918",2011-07-01 14:51:24,42,3,0,201101,71,98,57.50061,-168.75296,2011 +3.6,5.2,"I-18",2011-07-01 17:26:58,42,3,0,201101,70,98,57.67131,-168.406035,2011 +1.4,4.3,"JI1918",2011-07-02 07:10:37,42,3,0,201101,71,98,57.825065,-168.730215,2011 +1.7,4.2,"J-18",2011-07-02 10:16:58,42,3,0,201101,69,98,57.989025,-168.43065,2011 +1.2,4.2,"K-18",2011-07-02 12:54:47,41,3,0,201101,65,98,58.31991,-168.46197,2011 +2.3,3.6,"L-18",2011-07-02 15:28:59,20,3,0,201101,53,98,58.662625,-168.4836,2011 +3,3.6,"M-18",2011-07-02 17:52:27,20,3,0,201101,47,98,58.98824,-168.51245,2011 +3.3,3.5,"N-18",2011-07-03 06:56:26,20,3,0,201101,42,98,59.336275,-168.57399,2011 +3.7,3.8,"O-18",2011-07-03 09:20:31,20,3,0,201101,39,98,59.654125,-168.595905,2011 +3.6,4.5,"P-18",2011-07-03 11:52:26,20,3,0,201101,39,98,59.994165,-168.651575,2011 +5,5.2,"P-01",2011-07-03 14:38:46,20,3,0,201101,26,98,60.011665,-167.999005,2011 +6.5,6.6,"Q-02",2011-07-03 18:20:53,20,3,0,201101,33,98,60.33586,-167.26141,2011 +5.9,6.2,"Q-01",2011-07-04 06:50:39,20,3,0,201101,32,98,60.33244,-167.96404,2011 +4,5,"Q-18",2011-07-04 09:24:40,20,3,0,201101,36,98,60.33493,-168.663505,2011 +3.1,4.3,"Q-19",2011-07-04 12:08:56,20,3,0,201101,43,98,60.32971,-169.30202,2011 +1.2,4.6,"Q-20",2011-07-04 15:07:55,20,3,0,201101,51,98,60.33125,-169.985125,2011 +1,4.3,"O-20",2011-07-05 07:04:22,41,3,0,201101,56,98,59.68024,-169.93055,2011 +0.7,2.9,"N-20",2011-07-06 10:41:46,41,3,0,201101,60,98,59.338875,-169.8714,2011 +0.9,2.4,"M-20",2011-07-06 13:54:25,41,3,0,201101,63,98,59.000935,-169.81514,2011 +1.2,3.1,"L-20",2011-07-06 16:30:25,41,3,0,201101,67,98,58.66906,-169.7815,2011 +1.1,4.1,"K-20",2011-07-06 19:03:52,41,3,0,201101,69,98,58.336125,-169.74306,2011 +0.1,4.2,"J-20",2011-07-07 07:04:40,42,3,0,201101,70,98,58.0003,-169.70404,2011 +2,4.1,"JI2120",2011-07-07 09:57:21,42,3,0,201101,72,98,57.829475,-169.966575,2011 +3.1,4.3,"I-21",2011-07-07 12:28:49,42,3,0,201101,72,98,57.663135,-170.276935,2011 +2.7,6.2,"I-22",2011-07-07 15:16:23,42,3,0,201101,85,98,57.666075,-170.902955,2011 +2.9,6.7,"I-23",2011-07-07 18:08:27,41,3,0,201101,98,98,57.66863,-171.51975,2011 +1.6,4.9,"K-22",2011-07-08 07:02:05,41,3,0,201101,83,98,58.336225,-171.01475,2011 +0.7,4,"L-22",2011-07-08 09:31:42,41,3,0,201101,82,98,58.66673,-171.07385,2011 +-0.8,3.9,"M-22",2011-07-08 12:23:35,41,3,0,201101,77,98,59.0035,-171.11465,2011 +-0.9,3.8,"N-22",2011-07-08 14:45:39,41,3,0,201101,75,98,59.325775,-171.177285,2011 +-1.1,3.6,"O-22",2011-07-08 17:22:35,41,3,0,201101,72,98,59.67271,-171.24195,2011 +-0.1,3.9,"PO2423",2011-07-09 07:01:52,43,3,0,201101,75,98,59.839785,-172.24995,2011 +1.3,3.2,"QP2423",2011-07-09 09:34:19,43,3,0,201101,57,98,60.161885,-172.3268,2011 +-1,3.8,"P-24",2011-07-09 11:45:08,43,3,0,201101,67,98,59.99133,-172.592665,2011 +0.2,4,"PO2524",2011-07-09 14:01:09,43,3,0,201101,80,98,59.82541,-172.89496,2011 +0.2,4.1,"P-25",2011-07-09 16:07:37,43,3,0,201101,75,98,60.003825,-173.26305,2011 +0.9,4.4,"PO2625",2011-07-09 18:11:50,43,3,0,201101,94,98,59.83403,-173.56176,2011 +0.9,4.3,"O-25",2011-07-10 07:02:57,43,3,0,201101,94,98,59.673595,-173.250275,2011 +0.8,4.1,"O-24",2011-07-10 09:49:46,43,3,0,201101,84,98,59.6677,-172.563515,2011 +0.8,4,"ON2524",2011-07-10 11:55:51,43,3,0,201101,93,98,59.498765,-172.845595,2011 +0.9,4.1,"N-24",2011-07-10 14:08:39,43,3,0,201101,87,98,59.32776,-172.49862,2011 +1.8,4.6,"M-24",2011-07-10 16:57:58,41,3,0,201101,98,98,58.9963,-172.43204,2011 +2.9,6.7,"H-23",2011-07-11 07:11:00,41,3,0,201101,101,98,57.326265,-171.468815,2011 +3.2,6.7,"G-23",2011-07-11 09:41:41,61,3,0,201101,108,98,56.99842,-171.396685,2011 +3.6,7,"F-23",2011-07-11 12:09:42,61,3,0,201101,118,98,56.672305,-171.36807,2011 +3.9,7.4,"A-02",2011-07-14 07:30:21,50,3,0,201101,155,98,55.007465,-166.942,2011 +3.8,7.6,"B-02",2011-07-14 10:45:39,50,3,0,201101,138,98,55.34602,-166.97281,2011 +3.8,7.5,"C-02",2011-07-14 13:19:33,50,3,0,201101,134,98,55.67508,-166.98335,2011 +3.1,7.3,"H-24",2011-07-15 09:14:13,61,3,0,201101,108,98,57.3289,-172.093245,2011 +3.1,7.4,"I-24",2011-07-15 12:00:42,61,3,0,201101,107,98,57.66561,-172.161745,2011 +3.1,7.3,"I-25",2011-07-15 14:38:27,61,3,0,201101,118,98,57.66928,-172.80262,2011 +2.9,6.9,"J-25",2011-07-15 17:21:23,61,3,0,201101,108,98,58.003115,-172.86119,2011 +2.8,7.3,"J-24",2011-07-15 19:52:57,61,3,0,201101,105,98,58.00135,-172.238325,2011 +2.5,7,"K-25",2011-07-16 07:26:13,61,3,0,201101,109,98,58.335715,-172.92917,2011 +2.2,6.8,"K-24",2011-07-16 10:04:20,61,3,0,201101,102,98,58.33924,-172.2913,2011 +1.9,5.8,"L-24",2011-07-16 13:40:59,61,3,0,201101,101,98,58.66634,-172.376515,2011 +2.5,6.6,"L-25",2011-07-16 16:09:01,61,3,0,201101,111,98,58.66435,-173.000685,2011 +2.4,6.5,"M-25",2011-07-16 18:43:13,61,3,0,201101,106,98,59.007175,-173.084555,2011 +2.3,5.4,"N-26",2011-07-17 07:20:47,62,3,0,201101,110,98,59.335735,-173.79525,2011 +2.6,6,"N-27",2011-07-17 10:14:24,62,3,0,201101,120,98,59.33851,-174.439775,2011 +2.4,5.7,"O-27",2011-07-17 12:46:05,62,3,0,201101,114,98,59.66256,-174.44754,2011 +1.8,5.4,"P-27",2011-07-17 15:18:45,62,3,0,201101,107,98,59.997865,-174.590165,2011 +1.1,4,"Q-27",2011-07-17 17:53:10,62,3,0,201101,100,98,60.326315,-174.701775,2011 +0.6,5.2,"Q-26",2011-07-18 07:16:21,43,3,0,201101,91,98,60.336,-174.0685,2011 +0.6,5.3,"R-26",2011-07-18 09:50:54,41,3,0,201101,86,98,60.6755,-174.125875,2011 +-0.4,4.9,"R-25",2011-07-18 12:30:19,41,3,0,201101,66,98,60.67305,-173.466525,2011 +-0.3,4.6,"S-25",2011-07-18 15:00:02,41,3,0,201101,75,98,61.003975,-173.50249,2011 +-1.2,4.1,"S-24",2011-07-18 17:37:52,41,3,0,201101,66,98,60.99991,-172.8257,2011 +1.6,4.5,"R-24",2011-07-20 07:09:11,41,3,0,201101,45,98,60.669305,-172.748985,2011 +-1.1,5,"R-23",2011-07-20 09:39:21,41,3,0,201101,61,98,60.66317,-172.108925,2011 +-0.9,5.1,"R-22",2011-07-20 12:12:33,41,3,0,201101,63,98,60.669275,-171.41678,2011 +-1.1,5.2,"S-22",2011-07-20 14:48:36,41,3,0,201101,60,98,60.997615,-171.4781,2011 +-1.2,4.9,"S-23",2011-07-20 17:18:06,41,3,0,201101,64,98,60.998075,-172.147695,2011 +0.3,5.3,"S-26",2011-07-21 07:25:11,41,3,0,201101,83,98,60.99916,-174.187325,2011 +0.9,6.6,"R-27",2011-07-21 10:33:21,41,3,0,201101,97,98,60.664275,-174.81323,2011 +0.7,5.4,"S-27",2011-07-21 13:10:19,82,3,0,201101,92,98,60.993825,-174.86644,2011 +1.1,6,"S-28",2011-07-21 15:47:07,90,3,0,201101,102,98,60.998615,-175.54015,2011 +1.1,6.3,"S-29",2011-07-21 18:29:57,90,3,0,201101,112,98,60.99927,-176.30275,2011 +1.3,6.8,"R-29",2011-07-22 07:32:37,61,3,0,201101,118,98,60.666625,-176.192525,2011 +1.5,6.8,"R-30",2011-07-22 10:27:20,61,3,0,201101,129,98,60.66634,-176.798535,2011 +1.6,7.2,"Q-30",2011-07-22 13:14:45,61,3,0,201101,137,98,60.33444,-176.735995,2011 +1.6,6.4,"Q-29",2011-07-22 16:05:21,61,3,0,201101,122,98,60.324465,-176.039635,2011 +2.3,7.2,"P-29",2011-07-22 18:54:16,61,3,0,201101,129,98,60.012515,-175.934425,2011 +1.7,7.1,"P-30",2011-07-23 07:51:30,61,3,0,201101,141,98,60.004225,-176.719535,2011 +2.5,7.5,"O-30",2011-07-23 10:37:44,61,3,0,201101,135,98,59.672415,-176.573425,2011 +2.3,6.9,"O-29",2011-07-23 13:31:01,61,3,0,201101,137,98,59.65695,-175.855625,2011 +2.1,7.2,"N-29",2011-07-23 16:16:00,61,3,0,201101,136,98,59.321125,-175.74547,2011 +2.2,7.5,"N-30",2011-07-23 19:11:37,61,3,0,201101,136,98,59.33206,-176.377035,2011 0.3,7.6,"R-18",2010-07-30 14:25:21,70,3,0,201002,38,143,60.6671,-168.687715,2010 0.8,8.5,"S-18",2010-07-30 16:55:47,70,3,0,201002,37,143,60.995375,-168.735005,2010 0.4,8.7,"T-18",2010-07-30 19:31:20,70,3,0,201002,34,143,61.33046,-168.767805,2010 @@ -11859,189 +12042,23 @@ -0.8,3.8,"G-05",2012-06-16 11:05:55,31,3,0,201201,71,98,56.98338,-165.22915,2012 -0.5,2.9,"H-05",2012-06-16 14:05:43,31,3,0,201201,66,98,57.33482,-165.23293,2012 0.4,2.1,"I-05",2012-06-16 16:37:06,31,3,0,201201,61,98,57.65855,-165.24205,2012 -3.7,3.8,"H-16",2011-06-05 09:19:28,10,3,0,201101,32,98,57.3254,-158.42139,2011 -3.6,3.9,"I-16",2011-06-05 12:09:22,10,3,0,201101,36,98,57.67822,-158.364325,2011 -4.4,5.1,"J-16",2011-06-05 14:40:24,10,3,0,201101,35,98,58.018625,-158.318645,2011 -4,4.2,"J-15",2011-06-05 17:27:58,10,3,0,201101,42,98,57.99977,-158.96414,2011 -5.6,6.4,"K-14",2011-06-06 06:30:58,10,3,0,201101,26,98,58.339825,-159.55201,2011 -3.4,3.5,"J-14",2011-06-06 09:08:17,10,3,0,201101,42,98,58.00166,-159.611495,2011 -2.3,2.4,"I-14",2011-06-06 11:40:58,10,3,0,201101,49,98,57.665,-159.637325,2011 -3,3.1,"H-14",2011-06-06 14:15:06,10,3,0,201101,56,98,57.32956,-159.67317,2011 -3.9,4.2,"G-14",2011-06-06 16:46:32,10,3,0,201101,55,98,57.002925,-159.687325,2011 -4.7,4.9,"F-14",2011-06-07 06:36:42,10,3,0,201101,38,98,56.68835,-159.71041,2011 -3.9,4.3,"F-13",2011-06-07 09:27:45,31,3,0,201101,58,98,56.657695,-160.386375,2011 -3.9,4.5,"E-12",2011-06-07 14:54:41,10,3,0,201101,53,98,56.338425,-160.9812,2011 -3.3,4.7,"F-12",2011-06-07 17:28:52,31,3,0,201101,67,98,56.670475,-160.982825,2011 -3.2,3.6,"G-12",2011-06-08 06:27:35,31,3,0,201101,67,98,56.998355,-160.9434,2011 -2.7,2.8,"H-12",2011-06-08 09:07:11,31,3,0,201101,61,98,57.3318,-160.943115,2011 -2.2,2.3,"I-12",2011-06-08 11:44:58,31,3,0,201101,56,98,57.66769,-160.9007,2011 -2.8,2.7,"J-12",2011-06-08 14:20:22,10,3,0,201101,45,98,58.000825,-160.854765,2011 -4.9,5.1,"K-12",2011-06-08 16:59:00,10,3,0,201101,23,98,58.32182,-160.77504,2011 -2.7,3,"J-10",2011-06-09 06:21:30,10,3,0,201101,37,98,57.987025,-162.102265,2011 -2.3,2.6,"I-10",2011-06-09 08:47:44,10,3,0,201101,46,98,57.653465,-162.133425,2011 -2.3,2.9,"H-10",2011-06-09 11:03:58,10,3,0,201101,51,98,57.351905,-162.13991,2011 -2.3,3,"G-10",2011-06-09 13:41:55,31,3,0,201101,60,98,57.00593,-162.162975,2011 -2.1,3.3,"G-09",2011-06-09 16:20:34,31,3,0,201101,61,98,57.003005,-162.7859,2011 -3,4.6,"F-10",2011-06-10 06:27:33,31,3,0,201101,71,98,56.6619,-162.185875,2011 -2.7,5.2,"E-10",2011-06-10 09:03:54,31,3,0,201101,75,98,56.33111,-162.19315,2011 -3.9,4.5,"D-10",2011-06-10 11:37:11,31,3,0,201101,71,98,56.00302,-162.253435,2011 -4.4,5.5,"C-09",2011-06-10 16:32:52,10,3,0,201101,53,98,55.66759,-162.83745,2011 -4.7,5.7,"B-08",2011-06-11 09:23:58,31,3,0,201101,52,98,55.33541,-163.43236,2011 -3.9,5.9,"B-07",2011-06-11 16:57:17,31,3,0,201101,78,98,55.3408,-164.019675,2011 -2.7,5.1,"E-09",2011-06-12 06:35:45,31,3,0,201101,79,98,56.342565,-162.800835,2011 -2.6,5.4,"E-08",2011-06-12 09:25:06,31,3,0,201101,84,98,56.3338,-163.41599,2011 -1.8,5.4,"F-08",2011-06-12 12:06:52,31,3,3.1,201101,74,98,56.668075,-163.368345,2011 -2,3.9,"G-08",2011-06-12 14:45:52,31,3,0,201101,65,98,57.001925,-163.39286,2011 -2.1,3.4,"H-08",2011-06-12 17:14:17,10,3,0,201101,53,98,57.33856,-163.37324,2011 -3.2,3.2,"K-08",2011-06-13 06:25:14,10,3,0,201101,38,98,58.3411,-163.35971,2011 -3.9,3.9,"L-08",2011-06-13 08:46:18,10,3,0,201101,32,98,58.66605,-163.36031,2011 -4.6,4.6,"M-08",2011-06-13 11:18:24,10,3,0,201101,22,98,58.990615,-163.354575,2011 -5.4,5.5,"N-07",2011-06-13 14:30:27,10,3,0,201101,22,98,59.322005,-164.00498,2011 -3.6,3.6,"M-06",2011-06-14 06:31:17,10,3,0,201101,28,98,59.007975,-164.657395,2011 -3.5,3.6,"L-06",2011-06-14 09:07:59,10,3,0,201101,37,98,58.672435,-164.64874,2011 -2.3,2.5,"K-06",2011-06-14 11:31:55,10,3,0,201101,44,98,58.333425,-164.64246,2011 -2,2.2,"J-06",2011-06-14 13:55:05,10,3,0,201101,44,98,58.004055,-164.61441,2011 -2.2,3,"I-06",2011-06-14 16:27:14,10,3,0,201101,52,98,57.66989,-164.61525,2011 -0.8,3.6,"H-06",2011-06-15 06:26:27,31,3,0,201101,66,98,57.352965,-164.63506,2011 -2,4.5,"G-06",2011-06-15 09:03:39,31,3,0,201101,70,98,56.99777,-164.602055,2011 -2.5,5.3,"F-06",2011-06-15 11:28:44,31,3,0,201101,75,98,56.66538,-164.59178,2011 -2.4,5.7,"E-06",2011-06-15 14:00:28,31,3,0,201101,86,98,56.327805,-164.588475,2011 -2.2,6.3,"D-06",2011-06-15 16:34:44,31,3,0,201101,92,98,55.99676,-164.591725,2011 -2.4,5.4,"F-04",2011-06-16 06:39:29,31,3,0,201101,79,98,56.644215,-165.819575,2011 -1.6,3.9,"G-04",2011-06-16 09:15:18,31,3,0,201101,73,98,56.98431,-165.84926,2011 -0.4,3.8,"H-04",2011-06-16 12:14:09,31,3,0,201101,68,98,57.33043,-165.869225,2011 -0.8,2.8,"I-04",2011-06-16 15:10:57,31,3,0,201101,64,98,57.666025,-165.87991,2011 -2.1,2.7,"J-04",2011-06-16 18:06:34,10,3,0,201101,55,98,58.007805,-165.906625,2011 -2.2,2.2,"K-04",2011-06-17 06:29:19,10,3,0,201101,44,98,58.333865,-165.91866,2011 -2.7,2.7,"L-04",2011-06-17 09:02:32,10,3,0,201101,37,98,58.666715,-165.926125,2011 -3.2,3.2,"M-04",2011-06-17 11:30:38,20,3,0,201101,31,98,59.000325,-165.930295,2011 -4,4.1,"N-04",2011-06-17 13:59:29,20,3,0,201101,25,98,59.329825,-165.95459,2011 -4.8,4.9,"O-04",2011-06-17 16:20:15,20,3,0,201101,27,98,59.618385,-165.93924,2011 -4.2,4.2,"O-02",2011-06-19 06:20:36,20,3,0,201101,31,98,59.66255,-167.279505,2011 -4.1,4.2,"N-02",2011-06-19 08:43:53,20,3,0,201101,32,98,59.33595,-167.260375,2011 -2.6,2.9,"M-02",2011-06-19 11:13:50,20,3,0,201101,40,98,59.0013,-167.22526,2011 -2.4,2.8,"L-02",2011-06-19 13:35:56,20,3,0,201101,44,98,58.675005,-167.220765,2011 -2,2.5,"K-02",2011-06-19 16:01:22,20,3,0,201101,51,98,58.33393,-167.192525,2011 -1.1,3.2,"J-02",2011-06-20 06:33:49,31,3,0,201101,63,98,58.014685,-167.173745,2011 -1.1,3.7,"I-02",2011-06-20 09:12:04,31,3,0,201101,67,98,57.67584,-167.124775,2011 -2.1,3.9,"H-02",2011-06-20 12:06:31,31,3,0,201101,71,98,57.33541,-167.129335,2011 -3.4,5.7,"G-02",2011-06-20 14:37:58,31,3,0,201101,73,98,57.0014,-167.08218,2011 -5.3,6.1,"Z-05",2011-06-24 06:40:36,31,3,0,201101,82,98,54.6765,-165.151985,2011 -5.6,7.1,"A-06",2011-06-24 10:01:18,31,3,0,201101,63,98,55.025205,-164.59065,2011 -4.6,7.2,"B-06",2011-06-24 12:25:49,31,3,0,201101,101,98,55.34436,-164.55195,2011 -3.6,7.7,"C-06",2011-06-24 15:11:47,31,3,0,201101,96,98,55.67614,-164.587965,2011 -2.5,7.6,"E-04",2011-06-25 06:40:01,31,3,0,201101,92,98,56.319815,-165.801725,2011 -3.6,7.6,"D-04",2011-06-25 09:10:52,31,3,0,201101,106,98,56.009195,-165.785035,2011 -4,7.8,"C-04",2011-06-25 11:46:39,50,3,0,201101,117,98,55.667965,-165.803235,2011 -4,8.1,"B-04",2011-06-25 14:20:42,50,3,0,201101,120,98,55.342385,-165.78714,2011 -4.2,7.1,"A-04",2011-06-25 17:02:26,50,3,0,201101,130,98,54.998905,-165.76539,2011 -2.8,6.8,"F-02",2011-06-26 15:29:00,31,3,0,201101,95,98,56.673075,-167.06413,2011 -3,6.6,"F-01",2011-06-26 18:38:32,31,3,0,201101,103,98,56.66125,-167.646925,2011 -3.3,6.9,"E-02",2011-06-26 22:15:05,50,3,0,201101,113,98,56.337275,-167.04085,2011 -3.3,6.3,"F-18",2011-06-27 09:11:55,50,3,0,201101,106,98,56.660865,-168.299065,2011 -3.1,6.3,"GF1918",2011-06-27 11:31:03,32,3,0,201101,96,98,56.833515,-168.623565,2011 -3.4,6.3,"G-18",2011-06-27 13:31:50,32,3,0,201101,81,98,56.991725,-168.342065,2011 -3.5,5.2,"HG1918",2011-06-27 15:42:59,32,3,0,201101,76,98,57.169755,-168.60847,2011 -3.3,5.6,"H-18",2011-06-28 06:43:16,32,3,0,201101,74,98,57.331535,-168.376375,2011 -2.9,5.1,"H-19",2011-06-28 09:29:18,42,3,4.4,201101,70,98,57.33187,-168.98133,2011 -2.1,4.4,"HG2019",2011-06-28 13:08:10,42,3,0,201101,71,98,57.15973,-169.328765,2011 -3.1,5.1,"G-19",2011-06-28 15:42:33,32,3,0,201101,79,98,57.00081,-168.950855,2011 -3.3,4.3,"GF2019",2011-06-28 18:24:55,32,3,0,201101,81,98,56.829005,-169.264115,2011 -3.7,4.2,"HG2120",2011-06-29 06:50:50,42,3,0,201101,50,98,57.165825,-169.8903,2011 -1.7,3.8,"G-20",2011-06-29 09:42:10,42,3,0,201101,60,98,56.994735,-169.546975,2011 -3.7,4.8,"GF2120",2011-06-29 12:18:52,42,3,0,201101,71,98,56.835465,-169.855435,2011 -3.4,3.8,"G-21",2011-06-29 14:41:11,42,3,0,201101,68,98,57.0039,-170.159135,2011 -3.8,4.8,"H-21",2011-07-01 07:10:13,42,3,0,201101,56,98,57.33729,-170.21985,2011 -1.4,4.2,"H-20",2011-07-01 09:40:09,42,3,0,201101,61,98,57.329015,-169.614575,2011 -0.7,4.3,"IH2019",2011-07-01 11:59:06,42,3,0,201101,69,98,57.50109,-169.382925,2011 -3.5,5.2,"IH1918",2011-07-01 14:51:24,42,3,0,201101,71,98,57.50061,-168.75296,2011 -3.6,5.2,"I-18",2011-07-01 17:26:58,42,3,0,201101,70,98,57.67131,-168.406035,2011 -1.4,4.3,"JI1918",2011-07-02 07:10:37,42,3,0,201101,71,98,57.825065,-168.730215,2011 -1.7,4.2,"J-18",2011-07-02 10:16:58,42,3,0,201101,69,98,57.989025,-168.43065,2011 -1.2,4.2,"K-18",2011-07-02 12:54:47,41,3,0,201101,65,98,58.31991,-168.46197,2011 -2.3,3.6,"L-18",2011-07-02 15:28:59,20,3,0,201101,53,98,58.662625,-168.4836,2011 -3,3.6,"M-18",2011-07-02 17:52:27,20,3,0,201101,47,98,58.98824,-168.51245,2011 -3.3,3.5,"N-18",2011-07-03 06:56:26,20,3,0,201101,42,98,59.336275,-168.57399,2011 -3.7,3.8,"O-18",2011-07-03 09:20:31,20,3,0,201101,39,98,59.654125,-168.595905,2011 -3.6,4.5,"P-18",2011-07-03 11:52:26,20,3,0,201101,39,98,59.994165,-168.651575,2011 -5,5.2,"P-01",2011-07-03 14:38:46,20,3,0,201101,26,98,60.011665,-167.999005,2011 -6.5,6.6,"Q-02",2011-07-03 18:20:53,20,3,0,201101,33,98,60.33586,-167.26141,2011 -5.9,6.2,"Q-01",2011-07-04 06:50:39,20,3,0,201101,32,98,60.33244,-167.96404,2011 -4,5,"Q-18",2011-07-04 09:24:40,20,3,0,201101,36,98,60.33493,-168.663505,2011 -3.1,4.3,"Q-19",2011-07-04 12:08:56,20,3,0,201101,43,98,60.32971,-169.30202,2011 -1.2,4.6,"Q-20",2011-07-04 15:07:55,20,3,0,201101,51,98,60.33125,-169.985125,2011 -1,4.3,"O-20",2011-07-05 07:04:22,41,3,0,201101,56,98,59.68024,-169.93055,2011 -0.7,2.9,"N-20",2011-07-06 10:41:46,41,3,0,201101,60,98,59.338875,-169.8714,2011 -0.9,2.4,"M-20",2011-07-06 13:54:25,41,3,0,201101,63,98,59.000935,-169.81514,2011 -1.2,3.1,"L-20",2011-07-06 16:30:25,41,3,0,201101,67,98,58.66906,-169.7815,2011 -1.1,4.1,"K-20",2011-07-06 19:03:52,41,3,0,201101,69,98,58.336125,-169.74306,2011 -0.1,4.2,"J-20",2011-07-07 07:04:40,42,3,0,201101,70,98,58.0003,-169.70404,2011 -2,4.1,"JI2120",2011-07-07 09:57:21,42,3,0,201101,72,98,57.829475,-169.966575,2011 -3.1,4.3,"I-21",2011-07-07 12:28:49,42,3,0,201101,72,98,57.663135,-170.276935,2011 -2.7,6.2,"I-22",2011-07-07 15:16:23,42,3,0,201101,85,98,57.666075,-170.902955,2011 -2.9,6.7,"I-23",2011-07-07 18:08:27,41,3,0,201101,98,98,57.66863,-171.51975,2011 -1.6,4.9,"K-22",2011-07-08 07:02:05,41,3,0,201101,83,98,58.336225,-171.01475,2011 -0.7,4,"L-22",2011-07-08 09:31:42,41,3,0,201101,82,98,58.66673,-171.07385,2011 --0.8,3.9,"M-22",2011-07-08 12:23:35,41,3,0,201101,77,98,59.0035,-171.11465,2011 --0.9,3.8,"N-22",2011-07-08 14:45:39,41,3,0,201101,75,98,59.325775,-171.177285,2011 --1.1,3.6,"O-22",2011-07-08 17:22:35,41,3,0,201101,72,98,59.67271,-171.24195,2011 --0.1,3.9,"PO2423",2011-07-09 07:01:52,43,3,0,201101,75,98,59.839785,-172.24995,2011 -1.3,3.2,"QP2423",2011-07-09 09:34:19,43,3,0,201101,57,98,60.161885,-172.3268,2011 --1,3.8,"P-24",2011-07-09 11:45:08,43,3,0,201101,67,98,59.99133,-172.592665,2011 -0.2,4,"PO2524",2011-07-09 14:01:09,43,3,0,201101,80,98,59.82541,-172.89496,2011 -0.2,4.1,"P-25",2011-07-09 16:07:37,43,3,0,201101,75,98,60.003825,-173.26305,2011 -0.9,4.4,"PO2625",2011-07-09 18:11:50,43,3,0,201101,94,98,59.83403,-173.56176,2011 -0.9,4.3,"O-25",2011-07-10 07:02:57,43,3,0,201101,94,98,59.673595,-173.250275,2011 -0.8,4.1,"O-24",2011-07-10 09:49:46,43,3,0,201101,84,98,59.6677,-172.563515,2011 -0.8,4,"ON2524",2011-07-10 11:55:51,43,3,0,201101,93,98,59.498765,-172.845595,2011 -0.9,4.1,"N-24",2011-07-10 14:08:39,43,3,0,201101,87,98,59.32776,-172.49862,2011 -1.8,4.6,"M-24",2011-07-10 16:57:58,41,3,0,201101,98,98,58.9963,-172.43204,2011 -2.9,6.7,"H-23",2011-07-11 07:11:00,41,3,0,201101,101,98,57.326265,-171.468815,2011 -3.2,6.7,"G-23",2011-07-11 09:41:41,61,3,0,201101,108,98,56.99842,-171.396685,2011 -3.6,7,"F-23",2011-07-11 12:09:42,61,3,0,201101,118,98,56.672305,-171.36807,2011 -3.9,7.4,"A-02",2011-07-14 07:30:21,50,3,0,201101,155,98,55.007465,-166.942,2011 -3.8,7.6,"B-02",2011-07-14 10:45:39,50,3,0,201101,138,98,55.34602,-166.97281,2011 -3.8,7.5,"C-02",2011-07-14 13:19:33,50,3,0,201101,134,98,55.67508,-166.98335,2011 -3.1,7.3,"H-24",2011-07-15 09:14:13,61,3,0,201101,108,98,57.3289,-172.093245,2011 -3.1,7.4,"I-24",2011-07-15 12:00:42,61,3,0,201101,107,98,57.66561,-172.161745,2011 -3.1,7.3,"I-25",2011-07-15 14:38:27,61,3,0,201101,118,98,57.66928,-172.80262,2011 -2.9,6.9,"J-25",2011-07-15 17:21:23,61,3,0,201101,108,98,58.003115,-172.86119,2011 -2.8,7.3,"J-24",2011-07-15 19:52:57,61,3,0,201101,105,98,58.00135,-172.238325,2011 -2.5,7,"K-25",2011-07-16 07:26:13,61,3,0,201101,109,98,58.335715,-172.92917,2011 -2.2,6.8,"K-24",2011-07-16 10:04:20,61,3,0,201101,102,98,58.33924,-172.2913,2011 -1.9,5.8,"L-24",2011-07-16 13:40:59,61,3,0,201101,101,98,58.66634,-172.376515,2011 -2.5,6.6,"L-25",2011-07-16 16:09:01,61,3,0,201101,111,98,58.66435,-173.000685,2011 -2.4,6.5,"M-25",2011-07-16 18:43:13,61,3,0,201101,106,98,59.007175,-173.084555,2011 -2.3,5.4,"N-26",2011-07-17 07:20:47,62,3,0,201101,110,98,59.335735,-173.79525,2011 -2.6,6,"N-27",2011-07-17 10:14:24,62,3,0,201101,120,98,59.33851,-174.439775,2011 -2.4,5.7,"O-27",2011-07-17 12:46:05,62,3,0,201101,114,98,59.66256,-174.44754,2011 -1.8,5.4,"P-27",2011-07-17 15:18:45,62,3,0,201101,107,98,59.997865,-174.590165,2011 -1.1,4,"Q-27",2011-07-17 17:53:10,62,3,0,201101,100,98,60.326315,-174.701775,2011 -0.6,5.2,"Q-26",2011-07-18 07:16:21,43,3,0,201101,91,98,60.336,-174.0685,2011 -0.6,5.3,"R-26",2011-07-18 09:50:54,41,3,0,201101,86,98,60.6755,-174.125875,2011 --0.4,4.9,"R-25",2011-07-18 12:30:19,41,3,0,201101,66,98,60.67305,-173.466525,2011 --0.3,4.6,"S-25",2011-07-18 15:00:02,41,3,0,201101,75,98,61.003975,-173.50249,2011 --1.2,4.1,"S-24",2011-07-18 17:37:52,41,3,0,201101,66,98,60.99991,-172.8257,2011 -1.6,4.5,"R-24",2011-07-20 07:09:11,41,3,0,201101,45,98,60.669305,-172.748985,2011 --1.1,5,"R-23",2011-07-20 09:39:21,41,3,0,201101,61,98,60.66317,-172.108925,2011 --0.9,5.1,"R-22",2011-07-20 12:12:33,41,3,0,201101,63,98,60.669275,-171.41678,2011 --1.1,5.2,"S-22",2011-07-20 14:48:36,41,3,0,201101,60,98,60.997615,-171.4781,2011 --1.2,4.9,"S-23",2011-07-20 17:18:06,41,3,0,201101,64,98,60.998075,-172.147695,2011 -0.3,5.3,"S-26",2011-07-21 07:25:11,41,3,0,201101,83,98,60.99916,-174.187325,2011 -0.9,6.6,"R-27",2011-07-21 10:33:21,41,3,0,201101,97,98,60.664275,-174.81323,2011 -0.7,5.4,"S-27",2011-07-21 13:10:19,82,3,0,201101,92,98,60.993825,-174.86644,2011 -1.1,6,"S-28",2011-07-21 15:47:07,90,3,0,201101,102,98,60.998615,-175.54015,2011 -1.1,6.3,"S-29",2011-07-21 18:29:57,90,3,0,201101,112,98,60.99927,-176.30275,2011 -1.3,6.8,"R-29",2011-07-22 07:32:37,61,3,0,201101,118,98,60.666625,-176.192525,2011 -1.5,6.8,"R-30",2011-07-22 10:27:20,61,3,0,201101,129,98,60.66634,-176.798535,2011 -1.6,7.2,"Q-30",2011-07-22 13:14:45,61,3,0,201101,137,98,60.33444,-176.735995,2011 -1.6,6.4,"Q-29",2011-07-22 16:05:21,61,3,0,201101,122,98,60.324465,-176.039635,2011 -2.3,7.2,"P-29",2011-07-22 18:54:16,61,3,0,201101,129,98,60.012515,-175.934425,2011 -1.7,7.1,"P-30",2011-07-23 07:51:30,61,3,0,201101,141,98,60.004225,-176.719535,2011 -2.5,7.5,"O-30",2011-07-23 10:37:44,61,3,0,201101,135,98,59.672415,-176.573425,2011 -2.3,6.9,"O-29",2011-07-23 13:31:01,61,3,0,201101,137,98,59.65695,-175.855625,2011 -2.1,7.2,"N-29",2011-07-23 16:16:00,61,3,0,201101,136,98,59.321125,-175.74547,2011 -2.2,7.5,"N-30",2011-07-23 19:11:37,61,3,0,201101,136,98,59.33206,-176.377035,2011 +0.4,1.7,"I-03",2012-06-19 11:22:51,31,3,0,201201,67,98,57.67309,-166.520505,2012 +-0.8,3.5,"H-03",2012-06-19 13:51:55,31,3,0,201201,69,98,57.334535,-166.487615,2012 +-0.6,3.8,"G-03",2012-06-19 16:44:50,31,3,0,201201,74,98,57.00918,-166.463175,2012 +0.2,4.3,"F-03",2012-06-20 06:42:06,31,3,0,201201,85,98,56.666915,-166.444885,2012 +1.9,4.2,"E-03",2012-06-20 09:13:36,31,3,0,201201,104,98,56.348175,-166.416175,2012 +2.5,4.9,"D-03",2012-06-20 11:54:31,50,3,0,201201,124,98,56.000595,-166.401075,2012 +2.9,5.6,"C-03",2012-06-20 14:22:34,50,3,0,201201,127,98,55.675975,-166.39253,2012 +2.9,5.7,"B-03",2012-06-20 17:02:58,50,3,0,201201,132,98,55.341465,-166.345015,2012 +3,5.7,"B-02",2012-06-23 09:09:53,50,3,0,201201,140,98,55.3439,-166.9672,2012 +3,5.8,"B-01",2012-06-23 12:07:54,50,3,0,201201,147,98,55.349265,-167.56274,2012 +2.9,6.1,"C-01",2012-06-23 14:42:31,50,3,0,201201,134,98,55.670175,-167.58641,2012 +2.9,5.7,"D-01",2012-06-24 06:44:23,50,3,0,201201,133,98,56.00386,-167.61022,2012 +2.8,5.5,"E-01",2012-06-24 09:18:56,50,3,0,201201,129,98,56.332615,-167.649425,2012 +1.4,4.7,"F-01",2012-06-24 11:50:59,31,3,0,201201,103,98,56.665175,-167.67072,2012 +0.2,4.2,"G-01",2012-06-24 14:26:39,31,3,0,201201,78,98,56.996435,-167.70525,2012 +-0.4,4.3,"H-01",2012-06-24 17:03:43,31,3,0,201201,74,98,57.326935,-167.73854,2012 +0.5,3.2,"I-01",2012-06-25 06:33:49,31,3,0,201201,69,98,57.65845,-167.769965,2012 6.5,7.2,"G-15",2015-06-03 07:13:54,10,3,0,201501,33,98,56.9855,-159.127305,2015 5,6.6,"H-15",2015-06-03 10:00:00,10,3,0,201501,49,98,57.32689,-159.07707,2015 5.1,5.2,"I-15",2015-06-03 12:38:05,10,3,0,201501,49,98,57.665285,-159.011875,2015 @@ -12794,71 +12811,6 @@ 4.7,11.7,"H-26",2016-07-25 18:40:53,61,3,0,201601,121,98,57.33242,-173.32891,2016 4.4,11.6,"G-26",2016-07-26 08:08:20,61,3,0,201601,143,98,57.00217,-173.263705,2016 4.7,11.9,"F-25",2016-07-26 11:48:59,61,3,0,201601,135,98,56.682185,-172.57071,2016 --1.6,10.1,"W-27",2023-08-03 14:16:52,81,3,0,202302,78,143,62.333175,-175.274615,2023 --1.6,9.9,"W-26",2023-08-03 17:10:27,81,3,0,202302,70,143,62.32472,-174.577415,2023 -2.7,9.4,"AA-22",2023-08-04 08:14:19,70,3,0,202302,37,143,63.54793,-172.005705,2023 --0.1,9.8,"BB-22",2023-08-04 11:28:47,71,3,4.1,202302,53,143,64.01139,-172.00107,2023 -1.4,9.8,"BB-21",2023-08-04 14:33:54,71,3,0,202302,28,143,63.999665,-171.338195,2023 -8.7,8.9,"AA-21",2023-08-04 17:55:20,71,3,4.1,202302,21,143,63.69833,-171.06283,2023 -1.6,4,"BB-20",2023-08-05 13:30:30,71,3,0,202302,30,143,63.99256,-170.542745,2023 -3.2,5.9,"BB-19",2023-08-05 17:52:54,71,3,0,202302,34,143,63.989585,-169.78633,2023 -7.7,9.1,"AA-19",2023-08-06 08:12:48,71,3,0,202302,40,143,63.66424,-169.76115,2023 -2.7,8.7,"AA-18",2023-08-06 11:16:30,71,3,0,202302,36,143,63.667625,-169.03946,2023 -2.4,7.9,"BB-18",2023-08-06 13:53:54,71,3,0,202302,36,143,64.0034,-169.05327,2023 -1.5,7.1,"CC-18",2023-08-06 18:05:53,71,3,0,202302,40,143,64.311145,-169.095205,2023 -1.3,7.1,"DD-18",2023-08-07 08:08:48,71,3,4.5,202302,43,143,64.667855,-169.14426,2023 -1.7,5,"DD-19",2023-08-07 11:20:04,71,3,0,202302,47,143,64.65517,-169.907815,2023 -0.7,4.5,"CC-19",2023-08-07 13:58:08,71,3,0,202302,40,143,64.33681,-169.844335,2023 -1,7.1,"CC-20",2023-08-07 16:38:20,71,3,2.4,202302,37,143,64.335485,-170.5984,2023 -2.6,8.4,"CC-21",2023-08-07 19:53:26,71,3,0,202302,40,143,64.238655,-171.08973,2023 -2.1,7.1,"DD-20",2023-08-08 08:09:51,71,3,0,202302,48,143,64.648075,-170.61273,2023 -1.2,6.9,"EE-19",2023-08-08 11:26:30,71,3,0,202302,48,143,64.97509,-169.874555,2023 -1.3,8.1,"EE-18",2023-08-08 13:58:57,71,3,0,202302,49,143,65.00504,-169.124595,2023 -2.2,8.9,"FF-18",2023-08-08 18:23:00,71,3,0,202302,53,143,65.22058,-168.89404,2023 -4,9.6,"FF-01",2023-08-09 08:06:03,71,3,0,202302,53,143,65.334355,-168.380475,2023 -8.7,9.1,"FF-02",2023-08-09 11:14:11,71,3,0,202302,38,143,65.309555,-167.671965,2023 -7.7,7.8,"EE-02",2023-08-09 14:25:56,71,3,0,202302,34,143,65.00305,-167.634765,2023 -2.2,9.1,"EE-01",2023-08-09 17:16:13,71,3,0,202302,45,143,64.998255,-168.35851,2023 -1.7,8.4,"DD-01",2023-08-10 08:08:27,71,3,4.5,202302,39,143,64.665385,-168.339855,2023 -7,8.3,"DD-02",2023-08-10 12:07:14,71,3,0,202302,31,143,64.66966,-167.623415,2023 -9.9,12.8,"DD-03",2023-08-10 14:49:20,71,3,0,202302,24,143,64.687975,-166.861775,2023 -7.5,9.2,"CC-03",2023-08-10 18:02:16,71,3,0,202302,30,143,64.335255,-166.830965,2023 -6.2,8.2,"CC-02",2023-08-11 08:04:58,71,3,0,202302,31,143,64.343155,-167.564375,2023 -1.3,8,"CC-01",2023-08-11 12:09:14,71,3,0,202302,39,143,64.326695,-168.33837,2023 -1.6,9.3,"BB-01",2023-08-11 14:31:00,71,3,0,202302,36,143,64.012625,-168.303565,2023 -2.8,5.4,"AA-01",2023-08-11 17:00:29,71,3,0,202302,33,143,63.685195,-168.2721,2023 -3,7.6,"Y-01",2023-08-12 08:05:52,70,3,0,202302,39,143,63.010525,-168.216655,2023 -2.1,8.3,"Y-18",2023-08-12 10:48:24,70,3,0,202302,39,143,62.868295,-168.83146,2023 -0.8,8.3,"X-19",2023-08-12 13:47:06,70,3,0,202302,40,143,62.672485,-169.580125,2023 -0.2,8.2,"X-20",2023-08-12 16:36:34,70,3,0,202302,42,143,62.67057,-170.337955,2023 -0,8.4,"Y-21",2023-08-13 08:05:52,70,3,0,202302,47,143,62.99212,-171.129155,2023 --0.8,7.9,"Y-22",2023-08-13 10:53:48,70,3,0,202302,52,143,62.98291,-171.796425,2023 -0,7.8,"ZZ-23",2023-08-13 15:29:54,81,3,0,202302,63,143,63.325215,-172.58325,2023 --1.3,8.2,"ZZ-24",2023-08-13 18:12:37,81,3,0,202302,70,143,63.339365,-173.382295,2023 --1.5,8.1,"Y-25",2023-08-14 08:23:34,81,3,0,202302,74,143,62.9977,-174.01748,2023 --1.6,8.6,"X-25",2023-08-14 11:05:02,81,3,0,202302,68,143,62.64986,-173.9089,2023 --1.5,9.5,"X-24",2023-08-15 13:03:43,81,3,1.12,202302,65,143,62.66809,-173.266645,2023 --1.1,9.2,"X-23",2023-08-15 15:28:45,81,3,0,202302,54,143,62.66519,-172.5057,2023 --0.7,9.1,"W-23",2023-08-16 08:21:12,81,3,0,202302,54,143,62.332475,-172.420025,2023 --0.4,8.6,"W-22",2023-08-16 10:47:40,81,3,0,202302,47,143,62.33095,-171.745325,2023 -0.2,8.9,"W-21",2023-08-16 13:10:38,70,3,5.8,202302,42,143,62.331915,-171.05822,2023 -0.9,8.7,"W-20",2023-08-16 15:46:21,70,3,0,202302,40,143,62.33869,-170.315925,2023 -0.6,9,"V-20",2023-08-16 18:26:59,70,3,0,202302,46,143,62.000045,-170.261115,2023 -0.3,8.8,"V-21",2023-08-17 08:17:10,70,3,0,202302,50,143,62.00501,-170.9444,2023 --0.2,9.4,"V-22",2023-08-17 11:15:01,70,3,0,202302,52,143,62.002845,-171.61872,2023 --0.8,9.3,"V-23",2023-08-17 14:16:10,81,3,0,202302,55,143,62.001605,-172.33696,2023 --1.1,9.6,"V-24",2023-08-17 17:13:35,81,3,0,202302,58,143,62.006165,-173.052805,2023 --1,8.3,"T-24",2023-08-18 08:29:26,81,3,0,202302,69,143,61.33713,-172.93205,2023 --0.8,8.9,"T-23",2023-08-18 11:00:01,81,3,0,202302,63,143,61.333845,-172.26464,2023 --0.3,8,"T-22",2023-08-18 13:42:41,81,3,0,202302,56,143,61.333615,-171.527505,2023 --0.1,9.2,"U-22",2023-08-18 16:27:08,81,3,0,202302,55,143,61.653885,-171.581645,2023 -0.3,8.6,"U-21",2023-08-18 19:05:07,81,3,0,202302,50,143,61.667885,-170.89998,2023 --0.8,9.2,"S-21",2023-08-19 08:26:43,81,3,0,202302,54,143,61.003975,-170.821735,2023 -0.1,8.2,"T-20",2023-08-19 11:43:59,70,3,0,202302,47,143,61.334315,-170.173255,2023 -3.4,7.5,"T-19",2023-08-19 14:30:17,70,3,0,202302,40,143,61.335715,-169.448875,2023 -7.9,8.2,"S-18",2023-08-19 18:04:38,70,3,0,202302,36,143,61.02178,-168.73981,2023 -1.6,9,"R-20",2023-08-20 08:18:54,70,3,0,202302,49,143,60.6709,-170.053705,2023 -4.1,7.6,"R-19",2023-08-20 10:57:59,70,3,0,202302,43,143,60.67695,-169.368495,2023 6,6.5,"G-15",2018-06-03 06:34:48,10,3,0,201801,34,98,56.98975,-159.13775,2018 5.5,5.5,"H-15",2018-06-03 09:31:22,10,3,0,201801,49,98,57.332165,-159.0715,2018 5.3,5.4,"I-15",2018-06-03 12:18:42,10,3,0,201801,47,98,57.66587,-159.023465,2018 @@ -13077,70 +13029,253 @@ 8.7,8.9,"NBS-38",2018-08-14 07:53:23,70,13,0,201801,33,98,61.258615,-168.60031,2018 9.6,9.6,"NBS-39",2018-08-14 11:31:34,70,13,0,201801,35,98,60.74974,-168.532365,2018 5.6,8.5,"NBS-30",2018-08-14 15:44:01,70,13,0,201801,43,98,60.75149,-169.48561,2018 -5.3,5.2,"F-14",2021-05-31 07:07:47,10,3,0,202101,37,98,56.67546,-159.763285,2021 -4.9,5.1,"G-14",2021-05-31 10:25:30,10,3,0,202101,55,98,56.993,-159.692405,2021 -5.5,5.5,"G-15",2021-05-31 13:59:57,10,3,0,202101,34,98,56.98997,-159.140745,2021 -4.5,4.9,"H-15",2021-05-31 16:45:02,10,3,0,202101,50,98,57.33256,-159.058425,2021 -5.4,5.4,"H-16",2021-06-01 07:05:37,10,3,0,202101,31,98,57.332205,-158.372065,2021 -4.7,4.6,"I-16",2021-06-01 09:50:38,10,3,0,202101,37,98,57.664055,-158.36918,2021 -5.4,5.4,"J-16",2021-06-01 12:54:17,10,3,0,202101,35,98,57.982635,-158.34764,2021 -4.9,4.8,"J-15",2021-06-01 15:27:50,10,3,0,202101,41,98,57.99635,-158.96,2021 -4.4,4.6,"I-15",2021-06-01 18:07:11,10,3,0,202101,46,98,57.68957,-159.015895,2021 -4.4,4.7,"J-14",2021-06-02 07:01:49,10,3,0,202101,43,98,57.99269,-159.592505,2021 -4.9,5.9,"K-14",2021-06-02 09:32:47,10,3,0,202101,27,98,58.322625,-159.54108,2021 -4.1,4.4,"K-13",2021-06-02 12:08:35,10,3,0,202101,41,98,58.277255,-159.97996,2021 -6.9,7.1,"K-12",2021-06-02 15:12:11,10,3,2.1,202101,25,98,58.318185,-160.78215,2021 -4.7,5.1,"K-11",2021-06-03 07:01:42,10,3,0,202101,40,98,58.21784,-161.54222,2021 -3.8,4.3,"J-11",2021-06-03 09:53:47,10,3,0,202101,54,98,58.010945,-161.48513,2021 -4.1,5.7,"I-11",2021-06-03 13:11:46,10,3,0,202101,53,98,57.681445,-161.50494,2021 -3.9,7,"H-11",2021-06-03 15:59:43,31,3,0,202101,56,98,57.34618,-161.541985,2021 -3.9,7.6,"G-11",2021-06-03 18:49:38,31,3,0,202101,69,98,57.00893,-161.55829,2021 -3.7,7.1,"F-11",2021-06-04 07:06:52,31,3,0,202101,91,98,56.666365,-161.545625,2021 -3.6,7.1,"F-10",2021-06-04 09:54:50,31,3,0,202101,72,98,56.664975,-162.184085,2021 -4.6,6.7,"G-10",2021-06-04 12:32:03,31,3,3.13,202101,61,98,56.990355,-162.16297,2021 -4.9,5.8,"H-10",2021-06-04 15:11:24,10,3,0,202101,51,98,57.31773,-162.148515,2021 -4.2,5,"I-10",2021-06-04 17:49:29,10,3,0,202101,46,98,57.6555,-162.1249,2021 -3.9,4,"J-10",2021-06-05 06:59:56,10,3,0,202101,38,98,57.99219,-162.100655,2021 -4.2,4.5,"K-10",2021-06-05 09:48:02,10,3,0,202101,47,98,58.320435,-162.05301,2021 -4.2,4.2,"K-09",2021-06-05 12:40:35,10,3,0,202101,32,98,58.33177,-162.72142,2021 -4.2,4.3,"L-09",2021-06-05 15:15:54,10,3,5.41,202101,23,98,58.661615,-162.700945,2021 -4.3,4.2,"M-08",2021-06-06 06:58:12,10,3,0,202101,23,98,58.99245,-163.34096,2021 -4,3.9,"L-08",2021-06-06 09:38:23,10,3,0,202101,32,98,58.678185,-163.354015,2021 -3.6,3.6,"K-08",2021-06-06 12:27:05,10,3,0,202101,37,98,58.33029,-163.3675,2021 -3.2,3.3,"K-07",2021-06-06 15:14:02,10,3,0,202101,41,98,58.331065,-164.0103,2021 -3.4,3.7,"J-07",2021-06-06 18:07:44,10,3,0,202101,47,98,58.005175,-164.01354,2021 -4,4.5,"I-07",2021-06-07 07:02:17,10,3,0,202101,51,98,57.671825,-163.977185,2021 -3,6.1,"H-07",2021-06-07 10:04:25,31,3,0,202101,62,98,57.333605,-164.00172,2021 -3,6.3,"G-07",2021-06-07 12:52:26,31,3,0,202101,67,98,57.011995,-164.041925,2021 -3.1,6.3,"F-07",2021-06-07 15:40:00,31,3,0,202101,72,98,56.685175,-164.026635,2021 -2.9,6.3,"E-07",2021-06-08 07:02:53,31,3,0,202101,86,98,56.352035,-163.968305,2021 -3,6.6,"D-07",2021-06-08 09:51:59,31,3,3.13,202101,90,98,56.020845,-164.04278,2021 -3.5,6.5,"C-07",2021-06-08 12:31:06,31,3,0,202101,93,98,55.71306,-163.98506,2021 -4.1,6.8,"C-06",2021-06-08 15:15:51,31,3,0,202101,95,98,55.67942,-164.55986,2021 -3.1,6.8,"D-06",2021-06-08 17:43:18,31,3,0,202101,93,98,55.973945,-164.58916,2021 -3,6.2,"E-06",2021-06-09 07:05:13,31,3,0,202101,87,98,56.32531,-164.566145,2021 -2.6,5.9,"F-06",2021-06-09 10:25:07,31,3,0,202101,75,98,56.655465,-164.62561,2021 -2.4,5.9,"G-06",2021-06-09 13:10:57,31,3,0,202101,69,98,56.97916,-164.617155,2021 -2.8,6,"H-06",2021-06-09 15:58:48,31,3,0,202101,65,98,57.31172,-164.623045,2021 -3.7,4.7,"I-06",2021-06-10 07:00:14,10,3,0,202101,54,98,57.652665,-164.61768,2021 -3.9,4.1,"J-06",2021-06-10 09:36:47,10,3,0,202101,46,98,57.985165,-164.61398,2021 -3.4,3.7,"K-06",2021-06-10 12:14:43,10,3,0,202101,44,98,58.310675,-164.629545,2021 -3.5,3.6,"L-06",2021-06-10 14:56:19,10,3,0,202101,38,98,58.643975,-164.659635,2021 -3.8,4.2,"L-07",2021-06-10 17:55:01,10,3,0,202101,35,98,58.65413,-164.017835,2021 -4.1,4.1,"M-06",2021-06-11 06:57:40,10,3,0,202101,28,98,58.998725,-164.69558,2021 -4.1,4.5,"M-07",2021-06-11 09:55:33,10,3,0,202101,29,98,58.991635,-164.00971,2021 -5,8.2,"N-07",2021-06-11 12:19:59,10,3,0,202101,24,98,59.305495,-163.99428,2021 -5.2,5.2,"N-06",2021-06-11 15:08:48,10,3,0,202101,23,98,59.315655,-164.63546,2021 -4.3,4.3,"N-05",2021-06-11 17:43:17,20,3,0,202101,21,98,59.319455,-165.28555,2021 -3.7,3.7,"N-04",2021-06-12 07:01:48,20,3,0,202101,25,98,59.30163,-165.93246,2021 -4.3,4.4,"O-04",2021-06-12 09:35:26,20,3,0,202101,26,98,59.60477,-165.893595,2021 -3.7,3.8,"O-03",2021-06-12 12:31:32,20,3,0,202101,29,98,59.666435,-166.599765,2021 -3.3,3.3,"N-03",2021-06-13 06:57:41,20,3,0,202101,27,98,59.36822,-166.611045,2021 -3.6,3.6,"M-03",2021-06-13 09:46:25,20,3,0,202101,34,98,59.01453,-166.58374,2021 -3.7,4,"L-03",2021-06-13 12:33:20,20,3,0,202101,42,98,58.676755,-166.559165,2021 -3.5,4,"K-03",2021-06-13 15:13:33,10,3,0,202101,47,98,58.345125,-166.561315,2021 -2.4,4.9,"J-03",2021-06-13 17:59:03,31,3,0,202101,61,98,58.00868,-166.52884,2021 -2.2,5.2,"I-04",2021-06-14 07:01:44,31,3,0,202101,64,98,57.68004,-165.8883,2021 +7.4,7.6,"H-16",2019-06-03 07:26:38,10,3,0,201901,32,98,57.339565,-158.41131,2019 +6.9,6.9,"I-16",2019-06-03 11:57:48,10,3,0,201901,36,98,57.65599,-158.343915,2019 +6.8,7.1,"J-16",2019-06-03 14:59:34,10,3,0,201901,36,98,57.991035,-158.319795,2019 +8.1,9.4,"K-14",2019-06-04 06:55:16,10,3,0,201901,26,98,58.34331,-159.55448,2019 +6.5,7.3,"J-14",2019-06-04 09:54:06,10,3,0,201901,42,98,58.007205,-159.60134,2019 +5.9,7.7,"I-14",2019-06-04 12:41:36,10,3,0,201901,50,98,57.66768,-159.625385,2019 +5.5,7.6,"H-14",2019-06-04 15:46:58,10,3,0,201901,55,98,57.33502,-159.666085,2019 +5.7,7.9,"G-14",2019-06-04 18:18:17,10,3,0,201901,54,98,57.00525,-159.697,2019 +5.2,7.6,"G-13",2019-06-05 07:57:43,31,3,0,201901,63,98,57.00004,-160.334825,2019 +4.8,7.3,"G-12",2019-06-05 10:48:30,31,3,0,201901,66,98,56.996805,-160.946615,2019 +4.6,7.6,"H-12",2019-06-05 13:57:10,31,3,0,201901,63,98,57.335935,-160.927075,2019 +5.1,7.9,"I-12",2019-06-05 17:00:52,31,3,0,201901,56,98,57.66393,-160.881855,2019 +6,8.8,"J-12",2019-06-06 07:00:31,10,3,0,201901,46,98,58.00852,-160.869215,2019 +6.8,9,"K-12",2019-06-06 10:02:42,10,3,1.1,201901,33,98,58.286685,-160.82688,2019 +6.6,9,"K-11",2019-06-06 13:05:15,10,3,0,201901,40,98,58.22118,-161.544645,2019 +6.7,9.5,"K-10",2019-06-06 16:00:40,10,3,0,201901,47,98,58.30581,-162.04421,2019 +6.3,8.6,"J-10",2019-06-06 18:34:53,10,3,0,201901,36,98,57.992125,-162.107245,2019 +6.2,7,"I-10",2019-06-07 06:57:55,10,3,0,201901,47,98,57.67123,-162.12519,2019 +5.7,7,"H-10",2019-06-07 09:30:31,10,3,0,201901,52,98,57.33881,-162.144545,2019 +4.9,7.9,"G-10",2019-06-07 12:22:55,31,3,3.13,201901,61,98,56.99535,-162.164465,2019 +4.6,8.4,"F-10",2019-06-07 15:21:04,31,3,0,201901,71,98,56.665105,-162.18412,2019 +4.4,8.6,"E-10",2019-06-08 08:28:06,31,3,6,201901,78,98,56.33346,-162.189745,2019 +4.9,8.7,"D-10",2019-06-08 11:09:53,31,3,0,201901,74,98,56.00242,-162.282785,2019 +4.9,8.8,"C-09",2019-06-08 14:27:17,10,3,6,201901,51,98,55.6748,-162.8258,2019 +4.9,8.8,"C-08",2019-06-08 16:51:19,31,3,0,201901,80,98,55.65821,-163.421145,2019 +5.4,8.7,"B-08",2019-06-09 06:27:08,31,3,6.3,201901,53,98,55.34477,-163.413285,2019 +5.7,8.5,"B-07",2019-06-09 09:57:05,31,3,0,201901,78,98,55.34299,-164.01873,2019 +5.3,7.5,"B-06",2019-06-09 12:33:16,31,3,0,201901,101,98,55.33744,-164.555105,2019 +5.9,8,"A-06",2019-06-09 15:08:05,31,3,0,201901,64,98,55.043145,-164.578175,2019 +5.9,7.4,"Z-05",2019-06-09 18:24:07,31,3,4.4,201901,83,98,54.703735,-165.14213,2019 +5.1,8.4,"A-05",2019-06-11 06:36:32,50,3,0,201901,112,98,54.999705,-165.159035,2019 +4.9,8.4,"B-05",2019-06-11 09:11:23,50,3,6.3,201901,110,98,55.32119,-165.164915,2019 +4.8,8.9,"C-05",2019-06-11 11:47:30,31,3,0,201901,109,98,55.661495,-165.1725,2019 +5.2,9.2,"C-06",2019-06-11 14:37:39,31,3,0,201901,97,98,55.668895,-164.565195,2019 +5.1,9.3,"C-07",2019-06-11 17:14:38,31,3,6,201901,95,98,55.687125,-164.006615,2019 +4.7,9.3,"D-07",2019-06-12 06:34:34,31,3,0,201901,91,98,56.001385,-164.03945,2019 +4.5,9,"E-07",2019-06-12 09:12:22,31,3,3.1,201901,86,98,56.33301,-164.010565,2019 +4.1,9,"F-07",2019-06-12 11:52:45,31,3,0,201901,75,98,56.66518,-164.013135,2019 +4,8.5,"G-07",2019-06-12 14:25:30,31,3,0,201901,69,98,56.99533,-164.031225,2019 +4,8.7,"H-07",2019-06-13 06:23:45,31,3,0,201901,63,98,57.337265,-164.00222,2019 +6,7.2,"I-07",2019-06-13 09:00:46,10,3,0,201901,52,98,57.655995,-164.009235,2019 +6.1,9,"J-07",2019-06-13 11:37:32,10,3,5.5,201901,48,98,57.98949,-164.01547,2019 +6.2,10.2,"K-07",2019-06-13 14:20:58,10,3,0,201901,41,98,58.325555,-164.007825,2019 +7.5,7.8,"L-07",2019-06-13 16:48:56,10,3,0,201901,34,98,58.661635,-163.98811,2019 +8.1,8.1,"L-08",2019-06-14 06:29:36,10,3,0,201901,32,98,58.67313,-163.343305,2019 +9.3,9.4,"M-08",2019-06-14 09:01:35,10,3,0,201901,23,98,58.986895,-163.34393,2019 +8.1,8.2,"M-07",2019-06-14 11:28:08,10,3,0,201901,27,98,59.00585,-164.001005,2019 +8.2,8.1,"M-06",2019-06-14 13:54:24,10,3,5.5,201901,27,98,58.99485,-164.642005,2019 +7.1,7.8,"L-06",2019-06-14 16:24:02,10,3,0,201901,37,98,58.683295,-164.65094,2019 +6.3,8.9,"K-06",2019-06-15 06:31:47,10,3,0,201901,44,98,58.34169,-164.64511,2019 +6.6,8.3,"J-06",2019-06-15 09:21:07,10,3,0,201901,46,98,58.006375,-164.614155,2019 +5.2,8.5,"I-06",2019-06-15 11:56:25,10,3,0,201901,53,98,57.664385,-164.63374,2019 +3.6,8.3,"H-06",2019-06-15 14:35:35,31,3,0,201901,66,98,57.33372,-164.617605,2019 +4,9.1,"G-06",2019-06-15 17:24:56,31,3,0,201901,69,98,56.999015,-164.613,2019 +3.9,9.2,"F-06",2019-06-16 06:59:59,31,3,0,201901,75,98,56.672795,-164.58112,2019 +4.3,9.3,"E-06",2019-06-16 09:40:14,31,3,0,201901,86,98,56.338075,-164.577915,2019 +4.6,9.6,"D-06",2019-06-16 12:15:32,31,3,0,201901,92,98,55.98851,-164.577115,2019 +4.9,9.3,"D-05",2019-06-16 17:14:05,31,3,0,201901,96,98,55.98287,-165.1891,2019 +4.2,9.6,"E-05",2019-06-17 06:33:11,31,3,0,201901,86,98,56.33626,-165.21135,2019 +4.8,9.3,"E-04",2019-06-17 09:17:42,31,3,0,201901,92,98,56.32362,-165.79827,2019 +4.8,9.2,"D-04",2019-06-17 11:43:28,31,3,0,201901,106,98,56.01064,-165.79303,2019 +4.8,8.7,"C-04",2019-06-17 14:49:03,50,3,3,201901,117,98,55.661835,-165.80351,2019 +5.1,8.3,"B-04",2019-06-17 17:32:35,50,3,3,201901,119,98,55.340175,-165.78715,2019 +4.6,8,"A-04",2019-06-18 06:45:00,50,3,3,201901,130,98,55.005385,-165.74495,2019 +4.5,7.3,"AZ0504",2019-06-18 09:02:08,50,3,3,201901,155,98,54.834445,-165.524455,2019 +4.5,8.5,"A-02",2019-06-23 07:07:54,50,3,3,201901,156,98,55.00346,-166.93235,2019 +4.6,9.1,"B-02",2019-06-23 10:17:51,50,3,3,201901,140,98,55.350625,-166.968165,2019 +4.5,9.7,"C-02",2019-06-23 13:18:33,50,3,3,201901,135,98,55.65915,-166.980275,2019 +4.5,9.6,"D-02",2019-06-23 15:54:10,50,3,3,201901,135,98,55.988015,-167.006615,2019 +4.6,9.7,"E-02",2019-06-24 06:56:15,50,3,0,201901,113,98,56.336775,-167.0286,2019 +4.5,9.9,"F-02",2019-06-24 09:32:46,31,3,0,201901,95,98,56.671915,-167.07288,2019 +4.3,9.5,"G-02",2019-06-24 12:34:53,31,3,0,201901,74,98,57.00089,-167.094,2019 +4.1,9.7,"G-03",2019-06-24 15:52:02,31,3,0,201901,74,98,57.00364,-166.46765,2019 +4,10,"G-04",2019-06-25 06:58:49,31,3,0,201901,72,98,56.99247,-165.84465,2019 +3.7,9.7,"H-04",2019-06-25 09:57:48,31,3,0,201901,68,98,57.33336,-165.866005,2019 +3.8,9.7,"I-04",2019-06-25 12:53:00,31,3,0,201901,64,98,57.667605,-165.87953,2019 +4.8,8.7,"J-04",2019-06-25 15:32:08,10,3,0,201901,56,98,58.001765,-165.900445,2019 +6.6,8.3,"K-04",2019-06-25 18:25:53,10,3,0,201901,44,98,58.314775,-165.91242,2019 +7.7,7.8,"L-04",2019-06-26 07:09:56,10,3,0,201901,37,98,58.65884,-165.93737,2019 +7,7.5,"L-03",2019-06-26 11:13:04,20,3,0,201901,42,98,58.6697,-166.565745,2019 +6,6.7,"L-02",2019-06-26 14:01:30,20,3,0,201901,44,98,58.66974,-167.22477,2019 +6.4,7.3,"M-02",2019-06-26 16:33:38,20,3,0,201901,40,98,58.9959,-167.23006,2019 +6.2,7,"M-01",2019-06-27 06:59:45,20,3,0,201901,42,98,58.99315,-167.896,2019 +6,7.1,"N-01",2019-06-27 09:42:23,20,3,0,201901,40,98,59.32744,-167.90828,2019 +7.2,7.4,"O-01",2019-06-27 12:19:28,20,3,5.5,201901,35,98,59.673225,-167.952435,2019 +7.2,7.2,"P-01",2019-06-27 14:42:38,20,3,0,201901,26,98,59.99753,-167.99829,2019 +5,7.1,"P-18",2019-06-27 17:23:20,20,3,5.5,201901,39,98,59.997175,-168.64673,2019 +8.9,9.1,"Q-02",2019-06-28 06:58:37,20,3,0,201901,31,98,60.336595,-167.257945,2019 +8,8,"Q-01",2019-06-28 09:38:30,20,3,0,201901,32,98,60.334885,-167.97714,2019 +6.1,7.2,"Q-18",2019-06-28 12:05:03,20,3,0,201901,36,98,60.336065,-168.65879,2019 +3.5,8.7,"Q-19",2019-06-28 14:44:40,20,3,0,201901,43,98,60.33717,-169.31331,2019 +5.1,7.8,"O-18",2019-06-29 06:54:00,20,3,0,201901,39,98,59.668125,-168.61609,2019 +5.3,7.6,"N-18",2019-06-29 09:38:20,20,3,0,201901,41,98,59.338415,-168.554795,2019 +5.5,8.4,"M-18",2019-06-29 12:10:42,20,3,0,201901,46,98,59.008685,-168.529175,2019 +4.4,9.6,"L-18",2019-06-29 14:58:06,20,3,0,201901,53,98,58.672935,-168.488675,2019 +3.2,9.6,"L-19",2019-06-29 18:01:39,41,3,0,201901,63,98,58.67059,-169.135165,2019 +3.3,9.6,"K-19",2019-06-30 07:01:39,41,3,0,201901,68,98,58.325565,-169.10778,2019 +3.3,9.2,"J-19",2019-06-30 10:10:07,42,3,0,201901,70,98,57.998925,-169.052045,2019 +3.7,9.4,"JI1918",2019-06-30 12:57:02,42,3,0,201901,70,98,57.82608,-168.737835,2019 +3.9,9.8,"I-19",2019-06-30 15:45:51,42,3,0,201901,69,98,57.663775,-169.034005,2019 +4.2,9.9,"IH2019",2019-06-30 19:29:41,42,3,0,201901,71,98,57.5099,-169.36614,2019 +4.4,9.4,"GF2019",2019-07-01 08:05:15,32,3,5,201901,80,98,56.838385,-169.298225,2019 +5.5,9.4,"GF2120",2019-07-01 11:08:46,42,3,0,201901,72,98,56.836065,-169.902045,2019 +5.8,7.4,"G-21",2019-07-03 11:42:12,42,3,0,201901,65,98,57.01874,-170.20122,2019 +4.9,8.4,"G-22",2019-07-03 14:50:00,42,3,0,201901,95,98,57.000875,-170.788085,2019 +7.2,8,"HG2221",2019-07-03 17:22:37,42,3,5.3,201901,49,98,57.11589,-170.47024,2019 +7.2,8,"HG2120",2019-07-04 07:00:35,42,3,0,201901,53,98,57.156285,-169.84741,2019 +7.2,8.6,"H-21",2019-07-04 09:48:52,42,3,4.5,201901,53,98,57.331325,-170.16671,2019 +4.4,8.5,"IH2120",2019-07-04 11:54:50,42,3,0,201901,69,98,57.501705,-169.987175,2019 +5.4,8.7,"IH2221",2019-07-04 14:53:21,42,3,0,201901,73,98,57.494325,-170.54616,2019 +5.5,9,"H-22",2019-07-04 17:20:59,42,3,0,201901,82,98,57.33899,-170.841735,2019 +4.8,8.7,"I-22",2019-07-05 07:01:37,42,3,0,201901,86,98,57.66848,-170.900175,2019 +4.3,8.7,"JI2221",2019-07-05 09:58:54,42,3,0,201901,78,98,57.835065,-170.61108,2019 +4.1,9.1,"I-21",2019-07-05 13:25:35,42,3,0,201901,72,98,57.670965,-170.28428,2019 +3.7,9,"JI2120",2019-07-05 15:51:16,42,3,0,201901,72,98,57.815155,-170.006615,2019 +4,9,"J-22",2019-07-06 07:01:20,42,3,0,201901,87,98,57.99585,-170.982325,2019 +4,9.1,"J-21",2019-07-06 09:35:26,42,3,0,201901,74,98,58.002205,-170.340425,2019 +3.5,9,"K-21",2019-07-06 11:57:14,41,3,0,201901,74,98,58.32,-170.379245,2019 +3.7,9.1,"K-22",2019-07-06 14:38:02,41,3,0,201901,83,98,58.341925,-171.0144,2019 +3.4,9.2,"L-22",2019-07-06 16:54:50,41,3,0,201901,82,98,58.6585,-171.077795,2019 +3,9.4,"L-21",2019-07-07 07:02:20,41,3,0,201901,73,98,58.672935,-170.432965,2019 +3,9,"M-21",2019-07-07 09:28:57,41,3,0,201901,70,98,59.00371,-170.480575,2019 +2.8,9.9,"M-22",2019-07-07 12:08:17,41,3,0,201901,77,98,58.999705,-171.118205,2019 +2.6,9.2,"N-22",2019-07-07 14:35:24,41,3,0,201901,75,98,59.32573,-171.18238,2019 +2.8,9.3,"N-23",2019-07-08 06:59:38,43,3,0,201901,79,98,59.33174,-171.828855,2019 +3.2,10,"M-23",2019-07-08 09:45:12,41,3,0,201901,87,98,58.997585,-171.786115,2019 +3.6,10.2,"L-23",2019-07-08 12:19:31,41,3,0,201901,92,98,58.669605,-171.71027,2019 +3.7,11.6,"K-23",2019-07-08 15:00:00,41,3,0,201901,96,98,58.33301,-171.648795,2019 +3.9,10.3,"J-23",2019-07-08 17:31:12,41,3,0,201901,97,98,58.00116,-171.59948,2019 +4.3,10.7,"I-23",2019-07-09 07:03:48,41,3,0,201901,99,98,57.659995,-171.53644,2019 +4.4,10.2,"H-23",2019-07-09 09:53:48,41,3,5,201901,100,98,57.34001,-171.473595,2019 +4.6,9.8,"G-23",2019-07-09 12:36:47,61,3,0,201901,109,98,57.007405,-171.39197,2019 +4.4,9.9,"F-23",2019-07-09 15:26:25,61,3,0,201901,119,98,56.67088,-171.34666,2019 +4.3,9.8,"G-26",2019-07-14 07:46:11,61,3,0,201901,141,98,56.99321,-173.232605,2019 +4.3,10.7,"H-26",2019-07-14 10:54:47,61,3,0,201901,120,98,57.32767,-173.29911,2019 +4,11.2,"I-26",2019-07-14 15:49:13,61,3,0,201901,147,98,57.708985,-173.408905,2019 +3.9,11.1,"J-26",2019-07-15 09:31:34,61,3,0,201901,116,98,58.016445,-173.48927,2019 +3.8,10.6,"K-26",2019-07-15 12:23:58,61,3,0,201901,115,98,58.33021,-173.59014,2019 +4,10.9,"K-27",2019-07-15 15:19:19,61,3,0,201901,155,98,58.34423,-174.29394,2019 +3.8,11.3,"L-27",2019-07-15 17:50:42,61,3,0,201901,157,98,58.671315,-174.26988,2019 +3.8,11.5,"L-26",2019-07-16 07:41:19,61,3,0,201901,127,98,58.66677,-173.623615,2019 +3.6,11.6,"M-26",2019-07-16 10:24:29,61,3,0,201901,118,98,58.99066,-173.715865,2019 +3.2,11.4,"N-26",2019-07-16 13:15:20,62,3,0,201901,111,98,59.32022,-173.799355,2019 +3.1,11.4,"ON2625",2019-07-16 15:44:41,43,3,0,201901,103,98,59.483925,-173.50992,2019 +2.9,11.8,"O-26",2019-07-16 18:19:59,62,3,0,201901,105,98,59.668835,-173.854505,2019 +2.7,11.3,"PO2726",2019-07-17 07:40:28,62,3,0,201901,108,98,59.8172,-174.22902,2019 +2.5,11,"QP2726",2019-07-17 10:40:31,43,3,0,201901,101,98,60.14718,-174.35659,2019 +2.5,11.2,"Q-26",2019-07-17 12:48:47,43,3,0,201901,91,98,60.32013,-174.066965,2019 +2.6,11.3,"QP2625",2019-07-17 15:10:46,43,3,0,201901,87,98,60.133465,-173.764885,2019 +2.6,10.8,"P-26",2019-07-17 17:31:36,43,3,0,201901,96,98,60.015595,-173.936695,2019 +2.9,10.8,"O-25",2019-07-18 07:41:08,43,3,0,201901,96,98,59.661225,-173.231685,2019 +2.7,10.5,"PO2625",2019-07-18 10:12:06,43,3,0,201901,95,98,59.83169,-173.5523,2019 +2.4,10.2,"P-25",2019-07-18 12:39:00,43,3,0,201901,75,98,60.004275,-173.269195,2019 +2.5,8.4,"P-24",2019-07-18 15:38:05,43,3,0,201901,67,98,59.9942,-172.669075,2019 +3.6,8,"QP2423",2019-07-18 18:12:18,43,3,0,201901,58,98,60.162575,-172.343215,2019 +2.9,7.1,"QP2524",2019-07-19 07:40:16,43,3,0,201901,60,98,60.16502,-172.99523,2019 +2.8,9.4,"Q-25",2019-07-19 12:07:56,43,3,0,201901,63,98,60.299305,-173.380345,2019 +2.9,9.9,"R-25",2019-07-19 14:58:31,41,3,0,201901,65,98,60.66273,-173.4682,2019 +2.4,10.4,"R-26",2019-07-19 17:59:37,41,3,0,201901,86,98,60.66855,-174.123285,2019 +2.6,10.1,"Q-28",2019-07-20 07:45:12,61,3,0,201901,111,98,60.33795,-175.38835,2019 +3.1,10.2,"P-28",2019-07-20 10:37:15,61,3,0,201901,117,98,60.002235,-175.238685,2019 +3.4,10.2,"O-28",2019-07-20 13:31:50,61,3,0,201901,125,98,59.66951,-175.113535,2019 +3.4,10,"N-28",2019-07-20 16:20:43,61,3,0,201901,131,98,59.33945,-175.09689,2019 +3.2,9.9,"M-30",2019-07-22 07:42:12,61,3,0,201901,137,98,59.016675,-176.299385,2019 +3.6,9.6,"L-30",2019-07-22 11:07:35,61,3,0,201901,139,98,58.66701,-176.18098,2019 +3.4,9.7,"L-31",2019-07-22 13:55:25,61,3,0,201901,136,98,58.662475,-176.810235,2019 +3.5,9.5,"M-32",2019-07-22 18:09:17,61,3,0,201901,134,98,58.99139,-177.53332,2019 +3.3,9.6,"M-31",2019-07-23 07:55:29,61,3,0,201901,136,98,58.998565,-176.938225,2019 +3.2,9.5,"N-31",2019-07-23 10:31:13,61,3,0,201901,149,98,59.327425,-177.05585,2019 +3.3,9.9,"O-31",2019-07-23 13:05:46,61,3,0,201901,176,98,59.65589,-177.1321,2019 +2.7,9.6,"P-32",2019-07-23 18:15:54,61,3,0,201901,141,98,60.00657,-177.89505,2019 +1.8,9.8,"U-29",2019-07-25 14:03:53,90,3,0,201901,104,98,61.681125,-176.450545,2019 +2.2,10,"T-30",2019-07-25 16:59:15,90,3,0,201901,115,98,61.34204,-176.9457,2019 +3,10.1,"R-32",2019-07-26 13:44:07,61,3,0,201901,160,98,60.65082,-178.16562,2019 +1.7,10,"R-31",2019-07-26 16:07:31,61,3,0,201901,148,98,60.668315,-177.537575,2019 +1.5,10.5,"S-31",2019-07-27 07:45:55,90,3,0,201901,136,98,61.000705,-177.648315,2019 +2.3,10.1,"S-30",2019-07-27 10:16:28,90,3,0,201901,122,98,61.007415,-176.978815,2019 +1.9,10.3,"T-29",2019-07-27 13:33:44,90,3,0,201901,106,98,61.327305,-176.30998,2019 +1.6,10.5,"T-28",2019-07-27 15:59:43,90,3,0,201901,98,98,61.33526,-175.679635,2019 +1.5,10.1,"U-28",2019-07-27 18:31:12,82,3,0,201901,95,98,61.65933,-175.765925,2019 +1,10.9,"U-27",2019-07-28 07:37:18,82,3,0,201901,85,98,61.65876,-175.079595,2019 +0.4,10.8,"V-27",2019-07-28 10:12:52,82,3,0,201901,80,98,61.999075,-175.172015,2019 +1.2,10.6,"V-28",2019-07-28 12:37:24,82,3,0,201901,91,98,62.00035,-175.80656,2019 +5.3,5.2,"F-14",2021-05-31 07:07:47,10,3,0,202101,37,98,56.67546,-159.763285,2021 +4.9,5.1,"G-14",2021-05-31 10:25:30,10,3,0,202101,55,98,56.993,-159.692405,2021 +5.5,5.5,"G-15",2021-05-31 13:59:57,10,3,0,202101,34,98,56.98997,-159.140745,2021 +4.5,4.9,"H-15",2021-05-31 16:45:02,10,3,0,202101,50,98,57.33256,-159.058425,2021 +5.4,5.4,"H-16",2021-06-01 07:05:37,10,3,0,202101,31,98,57.332205,-158.372065,2021 +4.7,4.6,"I-16",2021-06-01 09:50:38,10,3,0,202101,37,98,57.664055,-158.36918,2021 +5.4,5.4,"J-16",2021-06-01 12:54:17,10,3,0,202101,35,98,57.982635,-158.34764,2021 +4.9,4.8,"J-15",2021-06-01 15:27:50,10,3,0,202101,41,98,57.99635,-158.96,2021 +4.4,4.6,"I-15",2021-06-01 18:07:11,10,3,0,202101,46,98,57.68957,-159.015895,2021 +4.4,4.7,"J-14",2021-06-02 07:01:49,10,3,0,202101,43,98,57.99269,-159.592505,2021 +4.9,5.9,"K-14",2021-06-02 09:32:47,10,3,0,202101,27,98,58.322625,-159.54108,2021 +4.1,4.4,"K-13",2021-06-02 12:08:35,10,3,0,202101,41,98,58.277255,-159.97996,2021 +6.9,7.1,"K-12",2021-06-02 15:12:11,10,3,2.1,202101,25,98,58.318185,-160.78215,2021 +4.7,5.1,"K-11",2021-06-03 07:01:42,10,3,0,202101,40,98,58.21784,-161.54222,2021 +3.8,4.3,"J-11",2021-06-03 09:53:47,10,3,0,202101,54,98,58.010945,-161.48513,2021 +4.1,5.7,"I-11",2021-06-03 13:11:46,10,3,0,202101,53,98,57.681445,-161.50494,2021 +3.9,7,"H-11",2021-06-03 15:59:43,31,3,0,202101,56,98,57.34618,-161.541985,2021 +3.9,7.6,"G-11",2021-06-03 18:49:38,31,3,0,202101,69,98,57.00893,-161.55829,2021 +3.7,7.1,"F-11",2021-06-04 07:06:52,31,3,0,202101,91,98,56.666365,-161.545625,2021 +3.6,7.1,"F-10",2021-06-04 09:54:50,31,3,0,202101,72,98,56.664975,-162.184085,2021 +4.6,6.7,"G-10",2021-06-04 12:32:03,31,3,3.13,202101,61,98,56.990355,-162.16297,2021 +4.9,5.8,"H-10",2021-06-04 15:11:24,10,3,0,202101,51,98,57.31773,-162.148515,2021 +4.2,5,"I-10",2021-06-04 17:49:29,10,3,0,202101,46,98,57.6555,-162.1249,2021 +3.9,4,"J-10",2021-06-05 06:59:56,10,3,0,202101,38,98,57.99219,-162.100655,2021 +4.2,4.5,"K-10",2021-06-05 09:48:02,10,3,0,202101,47,98,58.320435,-162.05301,2021 +4.2,4.2,"K-09",2021-06-05 12:40:35,10,3,0,202101,32,98,58.33177,-162.72142,2021 +4.2,4.3,"L-09",2021-06-05 15:15:54,10,3,5.41,202101,23,98,58.661615,-162.700945,2021 +4.3,4.2,"M-08",2021-06-06 06:58:12,10,3,0,202101,23,98,58.99245,-163.34096,2021 +4,3.9,"L-08",2021-06-06 09:38:23,10,3,0,202101,32,98,58.678185,-163.354015,2021 +3.6,3.6,"K-08",2021-06-06 12:27:05,10,3,0,202101,37,98,58.33029,-163.3675,2021 +3.2,3.3,"K-07",2021-06-06 15:14:02,10,3,0,202101,41,98,58.331065,-164.0103,2021 +3.4,3.7,"J-07",2021-06-06 18:07:44,10,3,0,202101,47,98,58.005175,-164.01354,2021 +4,4.5,"I-07",2021-06-07 07:02:17,10,3,0,202101,51,98,57.671825,-163.977185,2021 +3,6.1,"H-07",2021-06-07 10:04:25,31,3,0,202101,62,98,57.333605,-164.00172,2021 +3,6.3,"G-07",2021-06-07 12:52:26,31,3,0,202101,67,98,57.011995,-164.041925,2021 +3.1,6.3,"F-07",2021-06-07 15:40:00,31,3,0,202101,72,98,56.685175,-164.026635,2021 +2.9,6.3,"E-07",2021-06-08 07:02:53,31,3,0,202101,86,98,56.352035,-163.968305,2021 +3,6.6,"D-07",2021-06-08 09:51:59,31,3,3.13,202101,90,98,56.020845,-164.04278,2021 +3.5,6.5,"C-07",2021-06-08 12:31:06,31,3,0,202101,93,98,55.71306,-163.98506,2021 +4.1,6.8,"C-06",2021-06-08 15:15:51,31,3,0,202101,95,98,55.67942,-164.55986,2021 +3.1,6.8,"D-06",2021-06-08 17:43:18,31,3,0,202101,93,98,55.973945,-164.58916,2021 +3,6.2,"E-06",2021-06-09 07:05:13,31,3,0,202101,87,98,56.32531,-164.566145,2021 +2.6,5.9,"F-06",2021-06-09 10:25:07,31,3,0,202101,75,98,56.655465,-164.62561,2021 +2.4,5.9,"G-06",2021-06-09 13:10:57,31,3,0,202101,69,98,56.97916,-164.617155,2021 +2.8,6,"H-06",2021-06-09 15:58:48,31,3,0,202101,65,98,57.31172,-164.623045,2021 +3.7,4.7,"I-06",2021-06-10 07:00:14,10,3,0,202101,54,98,57.652665,-164.61768,2021 +3.9,4.1,"J-06",2021-06-10 09:36:47,10,3,0,202101,46,98,57.985165,-164.61398,2021 +3.4,3.7,"K-06",2021-06-10 12:14:43,10,3,0,202101,44,98,58.310675,-164.629545,2021 +3.5,3.6,"L-06",2021-06-10 14:56:19,10,3,0,202101,38,98,58.643975,-164.659635,2021 +3.8,4.2,"L-07",2021-06-10 17:55:01,10,3,0,202101,35,98,58.65413,-164.017835,2021 +4.1,4.1,"M-06",2021-06-11 06:57:40,10,3,0,202101,28,98,58.998725,-164.69558,2021 +4.1,4.5,"M-07",2021-06-11 09:55:33,10,3,0,202101,29,98,58.991635,-164.00971,2021 +5,8.2,"N-07",2021-06-11 12:19:59,10,3,0,202101,24,98,59.305495,-163.99428,2021 +5.2,5.2,"N-06",2021-06-11 15:08:48,10,3,0,202101,23,98,59.315655,-164.63546,2021 +4.3,4.3,"N-05",2021-06-11 17:43:17,20,3,0,202101,21,98,59.319455,-165.28555,2021 +3.7,3.7,"N-04",2021-06-12 07:01:48,20,3,0,202101,25,98,59.30163,-165.93246,2021 +4.3,4.4,"O-04",2021-06-12 09:35:26,20,3,0,202101,26,98,59.60477,-165.893595,2021 +3.7,3.8,"O-03",2021-06-12 12:31:32,20,3,0,202101,29,98,59.666435,-166.599765,2021 +3.3,3.3,"N-03",2021-06-13 06:57:41,20,3,0,202101,27,98,59.36822,-166.611045,2021 +3.6,3.6,"M-03",2021-06-13 09:46:25,20,3,0,202101,34,98,59.01453,-166.58374,2021 +3.7,4,"L-03",2021-06-13 12:33:20,20,3,0,202101,42,98,58.676755,-166.559165,2021 +3.5,4,"K-03",2021-06-13 15:13:33,10,3,0,202101,47,98,58.345125,-166.561315,2021 +2.4,4.9,"J-03",2021-06-13 17:59:03,31,3,0,202101,61,98,58.00868,-166.52884,2021 +2.2,5.2,"I-04",2021-06-14 07:01:44,31,3,0,202101,64,98,57.68004,-165.8883,2021 3,5.9,"H-04",2021-06-14 10:25:18,31,3,0,202101,68,98,57.34691,-165.867415,2021 3.5,5.9,"G-04",2021-06-14 13:23:46,31,3,0,202101,72,98,57.01136,-165.854065,2021 3.4,6.5,"F-04",2021-06-14 16:15:21,31,3,0,202101,78,98,56.67835,-165.84534,2021 @@ -13335,97 +13470,6 @@ 12,12.2,"R-01",2019-08-19 16:37:52,70,3,0,201902,30,143,60.665215,-168.022505,2019 10.6,11.3,"R-18",2019-08-20 08:07:48,70,3,0,201902,36,143,60.667385,-168.69992,2019 7.5,11.3,"R-19",2019-08-20 10:36:16,70,3,0,201902,42,143,60.66889,-169.36521,2019 --0.6,9.2,"W-27",2021-07-23 07:33:59,81,3,0,202102,79,143,62.33486,-175.275625,2021 --1.5,8.9,"W-26",2021-07-23 10:03:12,81,3,0,202102,72,143,62.337775,-174.61426,2021 --1.7,8.3,"X-26",2021-07-23 12:35:18,81,3,0,202102,73,143,62.659095,-174.621015,2021 --1.7,8.3,"X-25",2021-07-23 15:28:49,81,3,0,202102,70,143,62.65922,-173.913775,2021 --1.2,8.4,"W-25",2021-07-24 07:17:31,81,3,0,202102,64,143,62.332455,-173.83068,2021 --1.3,8.6,"W-24",2021-07-24 10:03:03,81,3,0,202102,59,143,62.348985,-173.16048,2021 --1.6,8.2,"X-24",2021-07-24 12:33:49,81,3,0,202102,64,143,62.662975,-173.16578,2021 --1.3,8.2,"X-23",2021-07-24 15:11:27,81,3,0,202102,54,143,62.667145,-172.44106,2021 --1.2,8.4,"X-22",2021-07-24 17:29:20,70,3,0,202102,50,143,62.67179,-171.8136,2021 --1.6,7.7,"Y-22",2021-07-25 07:23:00,70,3,0,202102,54,143,63.00793,-171.767845,2021 --1.7,7.8,"Y-23",2021-07-25 10:12:19,81,3,0,202102,61,143,63.003305,-172.56412,2021 --1.7,7.5,"Y-24",2021-07-25 12:37:05,81,3,0,202102,69,143,63.004,-173.215325,2021 --1.7,8,"Y-25",2021-07-25 15:19:48,81,3,0,202102,73,143,63.000435,-173.981685,2021 --1.6,7.4,"ZZ-24",2021-07-26 07:00:49,81,3,0,202102,71,143,63.339025,-173.357445,2021 --1.1,7.6,"ZZ-23",2021-07-26 09:32:13,81,3,0,202102,64,143,63.33523,-172.62468,2021 --1.5,7.6,"ZZ-22",2021-07-26 13:34:40,70,3,0,202102,59,143,63.24515,-171.99726,2021 --1,7.8,"AA-22",2021-07-26 16:03:24,70,3,0,202102,36,143,63.535055,-171.99621,2021 --1.5,7.9,"AA-23",2021-07-26 18:39:16,81,3,0,202102,55,143,63.657025,-172.673635,2021 --0.9,8.2,"BB-22",2021-07-27 09:55:50,71,3,0,202102,50,143,64.01035,-171.79476,2021 -0.9,7.7,"BB-21",2021-07-27 11:56:05,71,3,0,202102,33,143,64.04661,-171.351435,2021 -3,7.4,"BB-20",2021-07-27 14:46:06,71,3,0,202102,26,143,63.99391,-170.552865,2021 -6.7,6.7,"AA-21",2021-07-27 17:38:01,71,3,0,202102,21,143,63.6988,-171.051215,2021 -0.3,7.8,"CC-21",2021-07-28 13:29:27,71,3,0,202102,40,143,64.233985,-171.105935,2021 -0.6,7.9,"CC-20",2021-07-28 15:31:39,71,3,0,202102,34,143,64.28089,-170.67872,2021 -0.3,5.9,"CC-19",2021-07-29 07:14:04,71,3,0,202102,39,143,64.316715,-169.83788,2021 -0.3,0.9,"DD-19",2021-07-29 09:55:04,71,3,0,202102,47,143,64.65693,-169.90694,2021 -0.8,0.9,"DD-20",2021-07-29 12:35:19,71,3,1.12,202102,48,143,64.653585,-170.62823,2021 -0.9,0.4,"EE-19",2021-07-29 16:59:35,71,3,0,202102,49,143,65.009085,-169.950965,2021 -2.2,7.6,"FF-18",2021-07-30 07:18:04,71,3,4.1,202102,52,143,65.252895,-168.947575,2021 -1.3,1.6,"EE-18",2021-07-30 09:58:22,71,3,0,202102,49,143,65.017845,-169.10073,2021 --0.1,2.2,"DD-18",2021-07-30 12:55:17,71,3,0,202102,44,143,64.65804,-169.15643,2021 -0.3,7.4,"CC-18",2021-07-30 15:28:22,71,3,0,202102,39,143,64.33431,-169.097245,2021 -0.7,7.5,"CC-01",2021-07-31 07:18:26,71,3,0,202102,40,143,64.331415,-168.334425,2021 -1.6,7.2,"DD-01",2021-07-31 09:44:26,71,3,0,202102,39,143,64.653955,-168.331795,2021 -3.4,7,"EE-01",2021-07-31 12:18:21,71,3,0,202102,44,143,64.994345,-168.339065,2021 -4.9,5.6,"FF-01",2021-07-31 14:57:52,71,3,0,202102,53,143,65.32447,-168.362725,2021 -6.3,7.4,"CC-02",2021-08-01 07:18:28,71,3,0,202102,31,143,64.333085,-167.57719,2021 -7.4,7.6,"DD-02",2021-08-01 09:41:25,71,3,0,202102,31,143,64.657665,-167.605295,2021 -9.3,9.3,"EE-02",2021-08-01 12:10:57,71,3,0,202102,34,143,64.978615,-167.614405,2021 -8.4,9.5,"FF-02",2021-08-01 14:47:51,71,3,0,202102,34,143,65.265275,-167.88624,2021 -10.1,10,"DD-03",2021-08-05 07:28:51,71,3,0,202102,26,143,64.674045,-166.85066,2021 -5.3,7,"CC-03",2021-08-05 10:00:20,71,3,0,202102,31,143,64.3544,-166.835115,2021 -3.2,6.8,"BB-03",2021-08-05 12:41:43,71,3,0,202102,33,143,64.00184,-166.823305,2021 -4.6,5.6,"AA-03",2021-08-05 15:07:45,71,3,0,202102,30,143,63.680525,-166.77645,2021 -7.5,8.5,"AA-04",2021-08-05 17:28:29,71,3,0,202102,27,143,63.67123,-166.109065,2021 -10.6,10.8,"AA-05",2021-08-06 07:12:27,71,3,0,202102,19,143,63.66752,-165.319985,2021 -10.8,10.8,"BB-05",2021-08-06 09:50:24,71,3,0,202102,18,143,63.993235,-165.3112,2021 -10.7,11.2,"CC-05",2021-08-06 12:25:04,71,3,0,202102,22,143,64.309745,-165.3226,2021 -8.5,13.4,"CC-06",2021-08-06 15:14:34,71,3,0,202102,18,143,64.33082,-164.56584,2021 -11.1,11.2,"BB-06",2021-08-07 07:10:44,71,3,0,202102,20,143,64.000365,-164.567845,2021 -8.1,11.5,"BB-07",2021-08-07 09:31:11,71,3,0,202102,20,143,64.005645,-163.84167,2021 -9.5,13.1,"CC-07",2021-08-07 12:03:55,71,3,0,202102,19,143,64.332815,-163.833165,2021 -7.7,14,"CC-08",2021-08-07 14:41:58,71,3,0,202102,21,143,64.2493,-163.16383,2021 -8.4,13.2,"BB-08",2021-08-07 16:49:27,71,3,0,202102,20,143,64.02365,-163.07422,2021 -6.3,13.8,"CC-09",2021-08-08 07:07:28,71,3,0,202102,18,143,64.340615,-162.26762,2021 -11.1,14,"CC-10",2021-08-08 09:41:11,71,3,0,202102,15,143,64.307535,-161.57037,2021 -4.7,13.7,"BB-10",2021-08-08 12:06:19,71,3,0,202102,19,143,64.000315,-161.567645,2021 -5.7,13.2,"BB-09",2021-08-08 14:28:55,71,3,0,202102,18,143,63.998065,-162.31459,2021 -11.7,13.6,"AA-08",2021-08-09 07:07:05,71,3,0,202102,15,143,63.665455,-163.057025,2021 -12.5,12.5,"AA-07",2021-08-09 09:43:15,71,3,0,202102,15,143,63.66746,-163.807805,2021 -11.9,12,"AA-06",2021-08-09 12:10:40,71,3,0,202102,11,143,63.665845,-164.56674,2021 -11.2,12.9,"ZZ-05",2021-08-09 15:34:24,71,3,0,202102,16,143,63.3354,-165.337685,2021 -9.8,9.8,"Y-04",2021-08-10 07:10:25,70,3,0,202102,22,143,63.00607,-166.024015,2021 -9.4,9.3,"ZZ-04",2021-08-10 09:49:40,71,3,0,202102,24,143,63.32333,-166.034275,2021 -8.2,8.1,"ZZ-03",2021-08-10 12:17:52,71,3,0,202102,27,143,63.326175,-166.720785,2021 -8.9,9.1,"Y-03",2021-08-10 14:45:10,70,3,0,202102,28,143,63.00235,-166.75036,2021 -2,8.3,"Y-02",2021-08-10 17:13:38,70,3,0,202102,36,143,62.9969,-167.424855,2021 -1,8.1,"X-01",2021-08-11 07:27:49,70,3,0,202102,35,143,62.64567,-168.18579,2021 -3,8.4,"X-02",2021-08-11 10:02:39,70,3,0,202102,28,143,62.662255,-167.48342,2021 -9.6,9.9,"X-03",2021-08-11 12:46:45,70,3,0,202102,26,143,62.663465,-166.763945,2021 -10.2,10.5,"W-03",2021-08-11 15:09:25,70,3,0,202102,22,143,62.33807,-166.72109,2021 -8.7,9,"W-02",2021-08-11 18:58:23,70,3,0,202102,27,143,62.342515,-167.47154,2021 -3.3,8.7,"W-01",2021-08-12 07:34:37,70,3,0,202102,31,143,62.341485,-168.157475,2021 -1.3,8.8,"W-18",2021-08-12 10:05:22,70,3,0,202102,35,143,62.32697,-168.874705,2021 --0.3,8.4,"W-19",2021-08-12 13:40:10,70,3,0,202102,37,143,62.31809,-169.58511,2021 -1.8,8.8,"V-19",2021-08-12 16:01:53,70,3,0,202102,42,143,62.017705,-169.5518,2021 -3.8,8.7,"V-18",2021-08-13 07:41:30,70,3,0,202102,36,143,61.99519,-168.79878,2021 -8.4,8.5,"V-01",2021-08-13 10:14:00,70,3,0,202102,28,143,61.999715,-168.130655,2021 -8.1,9,"U-01",2021-08-13 12:44:49,70,3,0,202102,28,143,61.68086,-168.09308,2021 -7.5,8.4,"U-18",2021-08-13 15:27:36,70,3,0,202102,36,143,61.66585,-168.79037,2021 -5.1,8.7,"U-19",2021-08-13 17:57:13,70,3,0,202102,41,143,61.667485,-169.467605,2021 -3.2,8.7,"U-20",2021-08-15 07:54:39,70,3,0,202102,47,143,61.67021,-170.2141,2021 -2,8.4,"U-21",2021-08-15 10:34:03,81,3,0,202102,50,143,61.661175,-170.9271,2021 -2.7,8.8,"T-21",2021-08-15 13:19:41,81,3,0,202102,50,143,61.33833,-170.839695,2021 -4.3,8.7,"T-20",2021-08-15 15:44:03,70,3,0,202102,48,143,61.327975,-170.179565,2021 -4.9,9.1,"S-20",2021-08-15 18:30:24,70,3,0,202102,49,143,60.99985,-170.115065,2021 -3.5,9.3,"S-21",2021-08-16 08:03:04,81,3,0,202102,54,143,60.999635,-170.805845,2021 -3.6,9.7,"R-21",2021-08-16 10:37:35,81,3,0,202102,59,143,60.67469,-170.753935,2021 -4.5,9.5,"R-20",2021-08-16 13:16:32,70,3,0,202102,50,143,60.67186,-170.054575,2021 -7.7,8.9,"R-19",2021-08-16 15:42:08,70,3,0,202102,43,143,60.671735,-169.368795,2021 -8.5,8.5,"R-18",2021-08-16 18:05:12,70,3,0,202102,38,143,60.66512,-168.70247,2021 4.1,5.8,"F-13",2021-06-01 07:14:05,31,3,0,202101,61,98,56.671285,-160.36705,2021 4.3,5.8,"G-13",2021-06-01 12:17:52,31,3,0,202101,63,98,56.98959,-160.35143,2021 4.5,4.7,"H-13",2021-06-01 15:20:14,31,3,0,202101,63,98,57.32479,-160.299885,2021 @@ -13614,6 +13658,80 @@ 0.9,9.3,"U-28",2021-07-22 13:23:37,82,3,0,202101,95,98,61.674895,-175.82856,2021 0,9.3,"V-28",2021-07-22 15:53:46,82,3,0,202101,92,98,61.99729,-175.82884,2021 -0.3,9.4,"V-27",2021-07-22 18:21:06,82,3,0,202101,82,98,61.99316,-175.227855,2021 +0.2,10.3,"W-27",2019-07-28 15:46:08,81,3,0,201902,80,143,62.31661,-175.319035,2019 +-0.5,10.3,"W-26",2019-07-29 07:38:37,81,3,0,201902,71,143,62.33512,-174.571725,2019 +0.3,10.2,"W-25",2019-07-29 10:08:53,81,3,0,201902,64,143,62.334245,-173.86337,2019 +0.6,10.4,"W-24",2019-07-29 12:43:01,81,3,0,201902,59,143,62.334975,-173.156085,2019 +0.5,10.8,"W-23",2019-07-29 15:19:10,81,3,0,201902,55,143,62.3282,-172.451475,2019 +0.6,10.7,"V-23",2019-07-29 17:54:54,81,3,0,201902,56,143,62.00941,-172.371035,2019 +0.8,10.8,"V-22",2019-07-30 07:32:44,70,3,0,201902,53,143,61.985235,-171.655805,2019 +0.7,10.6,"W-22",2019-07-30 10:07:34,81,3,0,201902,47,143,62.321995,-171.706535,2019 +0.7,10.9,"W-21",2019-07-30 12:33:33,70,3,0,201902,43,143,62.33823,-171.04723,2019 +0.7,10.9,"V-21",2019-07-30 15:13:27,70,3,0,201902,50,143,61.99793,-170.978145,2019 +12.3,12.4,"CC-04",2019-08-04 10:25:47,71,3,0,201902,23,143,64.332775,-166.045795,2019 +11.2,12.2,"CC-03",2019-08-04 13:24:15,71,3,0,201902,30,143,64.338985,-166.83319,2019 +11.9,12.8,"DD-03",2019-08-04 16:43:44,71,3,0,201902,25,143,64.657275,-166.81831,2019 +8.5,8.8,"DD-02",2019-08-05 07:44:19,71,3,0,201902,30,143,64.673895,-167.605935,2019 +9.9,10.8,"EE-02",2019-08-05 10:24:23,71,3,0,201902,34,143,65.006105,-167.643845,2019 +9.6,10.3,"FF-02",2019-08-05 12:45:42,71,3,0,201902,38,143,65.30246,-167.669265,2019 +3.9,10.6,"FF-01",2019-08-05 15:06:44,71,3,0,201902,53,143,65.335015,-168.387785,2019 +2.1,7.5,"FF-18",2019-08-05 17:47:53,71,3,2.4,201902,53,143,65.223965,-168.904435,2019 +2.8,3.9,"EE-19",2019-08-06 07:31:18,71,3,0,201902,50,143,65.01169,-169.902515,2019 +2.3,4.7,"EE-18",2019-08-06 10:03:47,71,3,0,201902,49,143,65.01249,-169.11489,2019 +3.7,10.8,"EE-01",2019-08-06 12:38:40,71,3,0,201902,45,143,65.00024,-168.36148,2019 +2.1,9.2,"DD-01",2019-08-06 15:30:21,71,3,0,201902,41,143,64.6631,-168.349225,2019 +3.4,11.3,"CC-01",2019-08-07 07:22:06,71,3,0,201902,40,143,64.32977,-168.32124,2019 +5.5,8.6,"CC-02",2019-08-07 09:45:00,71,3,0,201902,31,143,64.31802,-167.61301,2019 +4,8.7,"BB-02",2019-08-07 12:23:55,71,3,0,201902,35,143,64.00194,-167.568545,2019 +3,11.8,"BB-01",2019-08-07 14:49:35,71,3,0,201902,37,143,64.01046,-168.277315,2019 +3.1,8.7,"BB-18",2019-08-08 07:20:21,71,3,0,201902,35,143,63.95837,-169.037045,2019 +6.3,10.4,"AA-18",2019-08-08 09:42:08,71,3,0,201902,36,143,63.667525,-169.007845,2019 +7.2,10.2,"AA-19",2019-08-08 12:20:12,71,3,4.1,201902,39,143,63.65616,-169.754585,2019 +3.3,8.8,"BB-19",2019-08-08 14:51:25,71,3,0,201902,35,143,63.988455,-169.77752,2019 +2.6,8.9,"CC-19",2019-08-08 17:16:12,71,3,0,201902,39,143,64.303325,-169.82463,2019 +2.4,8.8,"CC-18",2019-08-09 07:37:37,71,3,0,201902,40,143,64.329575,-169.076535,2019 +2.2,8.4,"DD-18",2019-08-09 10:10:49,71,3,1.12,201902,44,143,64.66013,-169.120555,2019 +1.8,3.6,"DD-19",2019-08-09 12:38:51,71,3,0,201902,47,143,64.66201,-169.88556,2019 +2.7,2.7,"DD-20",2019-08-10 07:39:07,71,3,0,201902,48,143,64.63456,-170.605155,2019 +1.9,7.3,"CC-20",2019-08-10 10:03:36,71,3,0,201902,37,143,64.3301,-170.59159,2019 +2,10.2,"CC-21",2019-08-10 12:13:57,71,3,0,201902,40,143,64.232535,-171.104195,2019 +4.4,10.4,"BB-20",2019-08-10 14:50:12,71,3,0,201902,29,143,63.993085,-170.55962,2019 +8.3,10.8,"AA-21",2019-08-11 07:43:08,71,3,0,201902,21,143,63.699605,-171.03479,2019 +3.8,10.6,"BB-21",2019-08-11 10:31:42,71,3,0,201902,32,143,64.04964,-171.353185,2019 +1.5,10.6,"BB-22",2019-08-11 18:07:45,71,3,0,201902,53,143,64.00155,-172.00702,2019 +0.3,9.8,"AA-23",2019-08-13 07:49:36,81,3,0,201902,56,143,63.6616,-172.721165,2019 +0.7,10.8,"AA-22",2019-08-13 10:10:30,70,3,1.12,201902,35,143,63.69839,-172.061445,2019 +0.6,10.6,"ZZ-22",2019-08-13 12:58:47,70,3,1.12,201902,59,143,63.299995,-171.984305,2019 +0.4,10.7,"ZZ-23",2019-08-13 15:40:25,81,3,0,201902,63,143,63.33313,-172.647645,2019 +0,10.9,"ZZ-24",2019-08-13 18:24:41,81,3,0,201902,71,143,63.336915,-173.406035,2019 +-0.5,10.2,"Y-23",2019-08-14 08:04:03,81,3,0,201902,62,143,63.02286,-172.60382,2019 +-0.6,10.1,"Y-24",2019-08-14 11:52:09,81,3,0,201902,70,143,63.010495,-173.293005,2019 +-0.2,11.1,"Y-25",2019-08-14 14:26:35,81,3,0,201902,74,143,63.001735,-174.0076,2019 +-0.1,10.6,"X-26",2019-08-14 18:12:31,81,3,0,201902,74,143,62.66971,-174.6305,2019 +-0.5,10.1,"X-25",2019-08-15 08:13:54,81,3,0,201902,69,143,62.65517,-173.90926,2019 +0.1,10.3,"X-24",2019-08-15 10:57:34,81,3,0,201902,65,143,62.66735,-173.19076,2019 +0.8,10.3,"X-23",2019-08-15 13:24:43,81,3,0,201902,55,143,62.668765,-172.508855,2019 +0.8,10,"X-22",2019-08-15 15:54:12,70,3,0,201902,50,143,62.66339,-171.8221,2019 +-0.6,10.6,"Y-22",2019-08-15 18:23:48,70,3,0,201902,53,143,62.974005,-171.806345,2019 +1.3,7.5,"ZZ-21",2019-08-16 08:03:32,70,3,4.1,201902,31,143,63.273085,-171.123505,2019 +-0.5,9.8,"Y-21",2019-08-16 10:06:07,70,3,0,201902,48,143,63.00214,-171.13227,2019 +-0.2,9.5,"Y-20",2019-08-16 12:37:35,70,3,0,201902,40,143,62.949575,-170.494965,2019 +0.5,9.7,"X-21",2019-08-16 15:43:53,70,3,0,201902,45,143,62.675665,-171.096775,2019 +0.2,10,"X-20",2019-08-17 08:04:52,70,3,0,201902,40,143,62.67188,-170.329935,2019 +1.1,10,"X-19",2019-08-17 10:30:16,70,3,0,201902,38,143,62.670615,-169.647345,2019 +2.7,10.6,"W-19",2019-08-17 13:05:37,70,3,0,201902,36,143,62.346275,-169.590045,2019 +2.6,10.7,"W-20",2019-08-17 15:43:01,70,3,0,201902,41,143,62.32753,-170.281995,2019 +1.6,11.3,"V-20",2019-08-18 08:11:33,70,3,0,201902,47,143,61.99635,-170.24224,2019 +2.4,11.3,"V-19",2019-08-18 10:40:42,70,3,0,201902,42,143,61.992035,-169.559745,2019 +5.5,11.5,"U-19",2019-08-18 13:10:23,70,3,0,201902,41,143,61.67139,-169.507085,2019 +2.5,11.5,"U-20",2019-08-18 15:42:44,70,3,0,201902,46,143,61.664485,-170.177965,2019 +3.8,11.9,"T-20",2019-08-18 18:09:38,70,3,0,201902,47,143,61.33742,-170.17414,2019 +8.7,11.5,"T-19",2019-08-19 08:08:39,70,3,0,201902,40,143,61.32734,-169.464865,2019 +6.3,11.5,"S-19",2019-08-19 10:40:37,70,3,0,201902,41,143,60.99903,-169.42226,2019 +4.1,11.5,"S-20",2019-08-19 13:10:58,70,3,0,201902,48,143,60.992235,-170.07322,2019 +2.9,11.6,"S-21",2019-08-19 15:51:26,81,3,0,201902,54,143,60.992635,-170.769875,2019 +3.1,11.5,"R-21",2019-08-20 08:18:39,81,3,0,201902,59,143,60.670745,-170.76827,2019 +4.2,11.6,"R-20",2019-08-20 11:14:56,70,3,0,201902,50,143,60.666145,-170.092865,2019 -1,8,"U-24",2022-07-29 13:33:55,81,3,0,202202,65,143,61.675715,-173.10262,2022 -0.9,7.8,"V-24",2022-07-29 16:26:56,81,3,0,202202,57,143,62.00947,-173.082955,2022 11.4,12.7,"CC-05",2022-08-02 07:25:00,71,3,0,202202,23,143,64.32042,-165.31448,2022 @@ -14187,6 +14305,97 @@ -0.8,8.5,"S-26",2022-07-28 16:27:01,41,3,0,202201,81,98,60.999555,-174.17599,2022 -0.7,8.3,"T-25",2022-07-29 08:08:54,82,3,0,202201,73,98,61.33369,-173.586225,2022 -1.1,8.3,"U-25",2022-07-29 11:02:58,82,3,0,202201,69,98,61.660095,-173.65809,2022 +-0.6,9.2,"W-27",2021-07-23 07:33:59,81,3,0,202102,79,143,62.33486,-175.275625,2021 +-1.5,8.9,"W-26",2021-07-23 10:03:12,81,3,0,202102,72,143,62.337775,-174.61426,2021 +-1.7,8.3,"X-26",2021-07-23 12:35:18,81,3,0,202102,73,143,62.659095,-174.621015,2021 +-1.7,8.3,"X-25",2021-07-23 15:28:49,81,3,0,202102,70,143,62.65922,-173.913775,2021 +-1.2,8.4,"W-25",2021-07-24 07:17:31,81,3,0,202102,64,143,62.332455,-173.83068,2021 +-1.3,8.6,"W-24",2021-07-24 10:03:03,81,3,0,202102,59,143,62.348985,-173.16048,2021 +-1.6,8.2,"X-24",2021-07-24 12:33:49,81,3,0,202102,64,143,62.662975,-173.16578,2021 +-1.3,8.2,"X-23",2021-07-24 15:11:27,81,3,0,202102,54,143,62.667145,-172.44106,2021 +-1.2,8.4,"X-22",2021-07-24 17:29:20,70,3,0,202102,50,143,62.67179,-171.8136,2021 +-1.6,7.7,"Y-22",2021-07-25 07:23:00,70,3,0,202102,54,143,63.00793,-171.767845,2021 +-1.7,7.8,"Y-23",2021-07-25 10:12:19,81,3,0,202102,61,143,63.003305,-172.56412,2021 +-1.7,7.5,"Y-24",2021-07-25 12:37:05,81,3,0,202102,69,143,63.004,-173.215325,2021 +-1.7,8,"Y-25",2021-07-25 15:19:48,81,3,0,202102,73,143,63.000435,-173.981685,2021 +-1.6,7.4,"ZZ-24",2021-07-26 07:00:49,81,3,0,202102,71,143,63.339025,-173.357445,2021 +-1.1,7.6,"ZZ-23",2021-07-26 09:32:13,81,3,0,202102,64,143,63.33523,-172.62468,2021 +-1.5,7.6,"ZZ-22",2021-07-26 13:34:40,70,3,0,202102,59,143,63.24515,-171.99726,2021 +-1,7.8,"AA-22",2021-07-26 16:03:24,70,3,0,202102,36,143,63.535055,-171.99621,2021 +-1.5,7.9,"AA-23",2021-07-26 18:39:16,81,3,0,202102,55,143,63.657025,-172.673635,2021 +-0.9,8.2,"BB-22",2021-07-27 09:55:50,71,3,0,202102,50,143,64.01035,-171.79476,2021 +0.9,7.7,"BB-21",2021-07-27 11:56:05,71,3,0,202102,33,143,64.04661,-171.351435,2021 +3,7.4,"BB-20",2021-07-27 14:46:06,71,3,0,202102,26,143,63.99391,-170.552865,2021 +6.7,6.7,"AA-21",2021-07-27 17:38:01,71,3,0,202102,21,143,63.6988,-171.051215,2021 +0.3,7.8,"CC-21",2021-07-28 13:29:27,71,3,0,202102,40,143,64.233985,-171.105935,2021 +0.6,7.9,"CC-20",2021-07-28 15:31:39,71,3,0,202102,34,143,64.28089,-170.67872,2021 +0.3,5.9,"CC-19",2021-07-29 07:14:04,71,3,0,202102,39,143,64.316715,-169.83788,2021 +0.3,0.9,"DD-19",2021-07-29 09:55:04,71,3,0,202102,47,143,64.65693,-169.90694,2021 +0.8,0.9,"DD-20",2021-07-29 12:35:19,71,3,1.12,202102,48,143,64.653585,-170.62823,2021 +0.9,0.4,"EE-19",2021-07-29 16:59:35,71,3,0,202102,49,143,65.009085,-169.950965,2021 +2.2,7.6,"FF-18",2021-07-30 07:18:04,71,3,4.1,202102,52,143,65.252895,-168.947575,2021 +1.3,1.6,"EE-18",2021-07-30 09:58:22,71,3,0,202102,49,143,65.017845,-169.10073,2021 +-0.1,2.2,"DD-18",2021-07-30 12:55:17,71,3,0,202102,44,143,64.65804,-169.15643,2021 +0.3,7.4,"CC-18",2021-07-30 15:28:22,71,3,0,202102,39,143,64.33431,-169.097245,2021 +0.7,7.5,"CC-01",2021-07-31 07:18:26,71,3,0,202102,40,143,64.331415,-168.334425,2021 +1.6,7.2,"DD-01",2021-07-31 09:44:26,71,3,0,202102,39,143,64.653955,-168.331795,2021 +3.4,7,"EE-01",2021-07-31 12:18:21,71,3,0,202102,44,143,64.994345,-168.339065,2021 +4.9,5.6,"FF-01",2021-07-31 14:57:52,71,3,0,202102,53,143,65.32447,-168.362725,2021 +6.3,7.4,"CC-02",2021-08-01 07:18:28,71,3,0,202102,31,143,64.333085,-167.57719,2021 +7.4,7.6,"DD-02",2021-08-01 09:41:25,71,3,0,202102,31,143,64.657665,-167.605295,2021 +9.3,9.3,"EE-02",2021-08-01 12:10:57,71,3,0,202102,34,143,64.978615,-167.614405,2021 +8.4,9.5,"FF-02",2021-08-01 14:47:51,71,3,0,202102,34,143,65.265275,-167.88624,2021 +10.1,10,"DD-03",2021-08-05 07:28:51,71,3,0,202102,26,143,64.674045,-166.85066,2021 +5.3,7,"CC-03",2021-08-05 10:00:20,71,3,0,202102,31,143,64.3544,-166.835115,2021 +3.2,6.8,"BB-03",2021-08-05 12:41:43,71,3,0,202102,33,143,64.00184,-166.823305,2021 +4.6,5.6,"AA-03",2021-08-05 15:07:45,71,3,0,202102,30,143,63.680525,-166.77645,2021 +7.5,8.5,"AA-04",2021-08-05 17:28:29,71,3,0,202102,27,143,63.67123,-166.109065,2021 +10.6,10.8,"AA-05",2021-08-06 07:12:27,71,3,0,202102,19,143,63.66752,-165.319985,2021 +10.8,10.8,"BB-05",2021-08-06 09:50:24,71,3,0,202102,18,143,63.993235,-165.3112,2021 +10.7,11.2,"CC-05",2021-08-06 12:25:04,71,3,0,202102,22,143,64.309745,-165.3226,2021 +8.5,13.4,"CC-06",2021-08-06 15:14:34,71,3,0,202102,18,143,64.33082,-164.56584,2021 +11.1,11.2,"BB-06",2021-08-07 07:10:44,71,3,0,202102,20,143,64.000365,-164.567845,2021 +8.1,11.5,"BB-07",2021-08-07 09:31:11,71,3,0,202102,20,143,64.005645,-163.84167,2021 +9.5,13.1,"CC-07",2021-08-07 12:03:55,71,3,0,202102,19,143,64.332815,-163.833165,2021 +7.7,14,"CC-08",2021-08-07 14:41:58,71,3,0,202102,21,143,64.2493,-163.16383,2021 +8.4,13.2,"BB-08",2021-08-07 16:49:27,71,3,0,202102,20,143,64.02365,-163.07422,2021 +6.3,13.8,"CC-09",2021-08-08 07:07:28,71,3,0,202102,18,143,64.340615,-162.26762,2021 +11.1,14,"CC-10",2021-08-08 09:41:11,71,3,0,202102,15,143,64.307535,-161.57037,2021 +4.7,13.7,"BB-10",2021-08-08 12:06:19,71,3,0,202102,19,143,64.000315,-161.567645,2021 +5.7,13.2,"BB-09",2021-08-08 14:28:55,71,3,0,202102,18,143,63.998065,-162.31459,2021 +11.7,13.6,"AA-08",2021-08-09 07:07:05,71,3,0,202102,15,143,63.665455,-163.057025,2021 +12.5,12.5,"AA-07",2021-08-09 09:43:15,71,3,0,202102,15,143,63.66746,-163.807805,2021 +11.9,12,"AA-06",2021-08-09 12:10:40,71,3,0,202102,11,143,63.665845,-164.56674,2021 +11.2,12.9,"ZZ-05",2021-08-09 15:34:24,71,3,0,202102,16,143,63.3354,-165.337685,2021 +9.8,9.8,"Y-04",2021-08-10 07:10:25,70,3,0,202102,22,143,63.00607,-166.024015,2021 +9.4,9.3,"ZZ-04",2021-08-10 09:49:40,71,3,0,202102,24,143,63.32333,-166.034275,2021 +8.2,8.1,"ZZ-03",2021-08-10 12:17:52,71,3,0,202102,27,143,63.326175,-166.720785,2021 +8.9,9.1,"Y-03",2021-08-10 14:45:10,70,3,0,202102,28,143,63.00235,-166.75036,2021 +2,8.3,"Y-02",2021-08-10 17:13:38,70,3,0,202102,36,143,62.9969,-167.424855,2021 +1,8.1,"X-01",2021-08-11 07:27:49,70,3,0,202102,35,143,62.64567,-168.18579,2021 +3,8.4,"X-02",2021-08-11 10:02:39,70,3,0,202102,28,143,62.662255,-167.48342,2021 +9.6,9.9,"X-03",2021-08-11 12:46:45,70,3,0,202102,26,143,62.663465,-166.763945,2021 +10.2,10.5,"W-03",2021-08-11 15:09:25,70,3,0,202102,22,143,62.33807,-166.72109,2021 +8.7,9,"W-02",2021-08-11 18:58:23,70,3,0,202102,27,143,62.342515,-167.47154,2021 +3.3,8.7,"W-01",2021-08-12 07:34:37,70,3,0,202102,31,143,62.341485,-168.157475,2021 +1.3,8.8,"W-18",2021-08-12 10:05:22,70,3,0,202102,35,143,62.32697,-168.874705,2021 +-0.3,8.4,"W-19",2021-08-12 13:40:10,70,3,0,202102,37,143,62.31809,-169.58511,2021 +1.8,8.8,"V-19",2021-08-12 16:01:53,70,3,0,202102,42,143,62.017705,-169.5518,2021 +3.8,8.7,"V-18",2021-08-13 07:41:30,70,3,0,202102,36,143,61.99519,-168.79878,2021 +8.4,8.5,"V-01",2021-08-13 10:14:00,70,3,0,202102,28,143,61.999715,-168.130655,2021 +8.1,9,"U-01",2021-08-13 12:44:49,70,3,0,202102,28,143,61.68086,-168.09308,2021 +7.5,8.4,"U-18",2021-08-13 15:27:36,70,3,0,202102,36,143,61.66585,-168.79037,2021 +5.1,8.7,"U-19",2021-08-13 17:57:13,70,3,0,202102,41,143,61.667485,-169.467605,2021 +3.2,8.7,"U-20",2021-08-15 07:54:39,70,3,0,202102,47,143,61.67021,-170.2141,2021 +2,8.4,"U-21",2021-08-15 10:34:03,81,3,0,202102,50,143,61.661175,-170.9271,2021 +2.7,8.8,"T-21",2021-08-15 13:19:41,81,3,0,202102,50,143,61.33833,-170.839695,2021 +4.3,8.7,"T-20",2021-08-15 15:44:03,70,3,0,202102,48,143,61.327975,-170.179565,2021 +4.9,9.1,"S-20",2021-08-15 18:30:24,70,3,0,202102,49,143,60.99985,-170.115065,2021 +3.5,9.3,"S-21",2021-08-16 08:03:04,81,3,0,202102,54,143,60.999635,-170.805845,2021 +3.6,9.7,"R-21",2021-08-16 10:37:35,81,3,0,202102,59,143,60.67469,-170.753935,2021 +4.5,9.5,"R-20",2021-08-16 13:16:32,70,3,0,202102,50,143,60.67186,-170.054575,2021 +7.7,8.9,"R-19",2021-08-16 15:42:08,70,3,0,202102,43,143,60.671735,-169.368795,2021 +8.5,8.5,"R-18",2021-08-16 18:05:12,70,3,0,202102,38,143,60.66512,-168.70247,2021 8.4,9.9,"CC-05",2023-07-29 07:34:07,71,3,0,202302,23,143,64.311,-165.314135,2023 8.5,14.2,"CC-06",2023-07-29 11:21:10,71,3,0,202302,15,143,64.324075,-164.53386,2023 5.5,14.6,"CC-07",2023-07-29 14:56:47,71,3,0,202302,18,143,64.33521,-163.78499,2023 @@ -14238,263 +14447,440 @@ 9.9,9.9,"R-02",2023-08-17 13:31:57,70,3,0,202302,25,143,60.672065,-167.33131,2023 9,9,"R-01",2023-08-18 07:59:50,70,3,0,202302,28,143,60.66684,-167.998665,2023 7.6,7.5,"R-18",2023-08-18 10:55:38,70,3,0,202302,37,143,60.67053,-168.69543,2023 -0.2,10.3,"W-27",2019-07-28 15:46:08,81,3,0,201902,80,143,62.31661,-175.319035,2019 --0.5,10.3,"W-26",2019-07-29 07:38:37,81,3,0,201902,71,143,62.33512,-174.571725,2019 -0.3,10.2,"W-25",2019-07-29 10:08:53,81,3,0,201902,64,143,62.334245,-173.86337,2019 -0.6,10.4,"W-24",2019-07-29 12:43:01,81,3,0,201902,59,143,62.334975,-173.156085,2019 -0.5,10.8,"W-23",2019-07-29 15:19:10,81,3,0,201902,55,143,62.3282,-172.451475,2019 -0.6,10.7,"V-23",2019-07-29 17:54:54,81,3,0,201902,56,143,62.00941,-172.371035,2019 -0.8,10.8,"V-22",2019-07-30 07:32:44,70,3,0,201902,53,143,61.985235,-171.655805,2019 -0.7,10.6,"W-22",2019-07-30 10:07:34,81,3,0,201902,47,143,62.321995,-171.706535,2019 -0.7,10.9,"W-21",2019-07-30 12:33:33,70,3,0,201902,43,143,62.33823,-171.04723,2019 -0.7,10.9,"V-21",2019-07-30 15:13:27,70,3,0,201902,50,143,61.99793,-170.978145,2019 -12.3,12.4,"CC-04",2019-08-04 10:25:47,71,3,0,201902,23,143,64.332775,-166.045795,2019 -11.2,12.2,"CC-03",2019-08-04 13:24:15,71,3,0,201902,30,143,64.338985,-166.83319,2019 -11.9,12.8,"DD-03",2019-08-04 16:43:44,71,3,0,201902,25,143,64.657275,-166.81831,2019 -8.5,8.8,"DD-02",2019-08-05 07:44:19,71,3,0,201902,30,143,64.673895,-167.605935,2019 -9.9,10.8,"EE-02",2019-08-05 10:24:23,71,3,0,201902,34,143,65.006105,-167.643845,2019 -9.6,10.3,"FF-02",2019-08-05 12:45:42,71,3,0,201902,38,143,65.30246,-167.669265,2019 -3.9,10.6,"FF-01",2019-08-05 15:06:44,71,3,0,201902,53,143,65.335015,-168.387785,2019 -2.1,7.5,"FF-18",2019-08-05 17:47:53,71,3,2.4,201902,53,143,65.223965,-168.904435,2019 -2.8,3.9,"EE-19",2019-08-06 07:31:18,71,3,0,201902,50,143,65.01169,-169.902515,2019 -2.3,4.7,"EE-18",2019-08-06 10:03:47,71,3,0,201902,49,143,65.01249,-169.11489,2019 -3.7,10.8,"EE-01",2019-08-06 12:38:40,71,3,0,201902,45,143,65.00024,-168.36148,2019 -2.1,9.2,"DD-01",2019-08-06 15:30:21,71,3,0,201902,41,143,64.6631,-168.349225,2019 -3.4,11.3,"CC-01",2019-08-07 07:22:06,71,3,0,201902,40,143,64.32977,-168.32124,2019 -5.5,8.6,"CC-02",2019-08-07 09:45:00,71,3,0,201902,31,143,64.31802,-167.61301,2019 -4,8.7,"BB-02",2019-08-07 12:23:55,71,3,0,201902,35,143,64.00194,-167.568545,2019 -3,11.8,"BB-01",2019-08-07 14:49:35,71,3,0,201902,37,143,64.01046,-168.277315,2019 -3.1,8.7,"BB-18",2019-08-08 07:20:21,71,3,0,201902,35,143,63.95837,-169.037045,2019 -6.3,10.4,"AA-18",2019-08-08 09:42:08,71,3,0,201902,36,143,63.667525,-169.007845,2019 -7.2,10.2,"AA-19",2019-08-08 12:20:12,71,3,4.1,201902,39,143,63.65616,-169.754585,2019 -3.3,8.8,"BB-19",2019-08-08 14:51:25,71,3,0,201902,35,143,63.988455,-169.77752,2019 -2.6,8.9,"CC-19",2019-08-08 17:16:12,71,3,0,201902,39,143,64.303325,-169.82463,2019 -2.4,8.8,"CC-18",2019-08-09 07:37:37,71,3,0,201902,40,143,64.329575,-169.076535,2019 -2.2,8.4,"DD-18",2019-08-09 10:10:49,71,3,1.12,201902,44,143,64.66013,-169.120555,2019 -1.8,3.6,"DD-19",2019-08-09 12:38:51,71,3,0,201902,47,143,64.66201,-169.88556,2019 -2.7,2.7,"DD-20",2019-08-10 07:39:07,71,3,0,201902,48,143,64.63456,-170.605155,2019 -1.9,7.3,"CC-20",2019-08-10 10:03:36,71,3,0,201902,37,143,64.3301,-170.59159,2019 -2,10.2,"CC-21",2019-08-10 12:13:57,71,3,0,201902,40,143,64.232535,-171.104195,2019 -4.4,10.4,"BB-20",2019-08-10 14:50:12,71,3,0,201902,29,143,63.993085,-170.55962,2019 -8.3,10.8,"AA-21",2019-08-11 07:43:08,71,3,0,201902,21,143,63.699605,-171.03479,2019 -3.8,10.6,"BB-21",2019-08-11 10:31:42,71,3,0,201902,32,143,64.04964,-171.353185,2019 -1.5,10.6,"BB-22",2019-08-11 18:07:45,71,3,0,201902,53,143,64.00155,-172.00702,2019 -0.3,9.8,"AA-23",2019-08-13 07:49:36,81,3,0,201902,56,143,63.6616,-172.721165,2019 -0.7,10.8,"AA-22",2019-08-13 10:10:30,70,3,1.12,201902,35,143,63.69839,-172.061445,2019 -0.6,10.6,"ZZ-22",2019-08-13 12:58:47,70,3,1.12,201902,59,143,63.299995,-171.984305,2019 -0.4,10.7,"ZZ-23",2019-08-13 15:40:25,81,3,0,201902,63,143,63.33313,-172.647645,2019 -0,10.9,"ZZ-24",2019-08-13 18:24:41,81,3,0,201902,71,143,63.336915,-173.406035,2019 --0.5,10.2,"Y-23",2019-08-14 08:04:03,81,3,0,201902,62,143,63.02286,-172.60382,2019 --0.6,10.1,"Y-24",2019-08-14 11:52:09,81,3,0,201902,70,143,63.010495,-173.293005,2019 --0.2,11.1,"Y-25",2019-08-14 14:26:35,81,3,0,201902,74,143,63.001735,-174.0076,2019 --0.1,10.6,"X-26",2019-08-14 18:12:31,81,3,0,201902,74,143,62.66971,-174.6305,2019 --0.5,10.1,"X-25",2019-08-15 08:13:54,81,3,0,201902,69,143,62.65517,-173.90926,2019 -0.1,10.3,"X-24",2019-08-15 10:57:34,81,3,0,201902,65,143,62.66735,-173.19076,2019 -0.8,10.3,"X-23",2019-08-15 13:24:43,81,3,0,201902,55,143,62.668765,-172.508855,2019 -0.8,10,"X-22",2019-08-15 15:54:12,70,3,0,201902,50,143,62.66339,-171.8221,2019 --0.6,10.6,"Y-22",2019-08-15 18:23:48,70,3,0,201902,53,143,62.974005,-171.806345,2019 -1.3,7.5,"ZZ-21",2019-08-16 08:03:32,70,3,4.1,201902,31,143,63.273085,-171.123505,2019 --0.5,9.8,"Y-21",2019-08-16 10:06:07,70,3,0,201902,48,143,63.00214,-171.13227,2019 --0.2,9.5,"Y-20",2019-08-16 12:37:35,70,3,0,201902,40,143,62.949575,-170.494965,2019 -0.5,9.7,"X-21",2019-08-16 15:43:53,70,3,0,201902,45,143,62.675665,-171.096775,2019 -0.2,10,"X-20",2019-08-17 08:04:52,70,3,0,201902,40,143,62.67188,-170.329935,2019 -1.1,10,"X-19",2019-08-17 10:30:16,70,3,0,201902,38,143,62.670615,-169.647345,2019 -2.7,10.6,"W-19",2019-08-17 13:05:37,70,3,0,201902,36,143,62.346275,-169.590045,2019 -2.6,10.7,"W-20",2019-08-17 15:43:01,70,3,0,201902,41,143,62.32753,-170.281995,2019 -1.6,11.3,"V-20",2019-08-18 08:11:33,70,3,0,201902,47,143,61.99635,-170.24224,2019 -2.4,11.3,"V-19",2019-08-18 10:40:42,70,3,0,201902,42,143,61.992035,-169.559745,2019 -5.5,11.5,"U-19",2019-08-18 13:10:23,70,3,0,201902,41,143,61.67139,-169.507085,2019 -2.5,11.5,"U-20",2019-08-18 15:42:44,70,3,0,201902,46,143,61.664485,-170.177965,2019 -3.8,11.9,"T-20",2019-08-18 18:09:38,70,3,0,201902,47,143,61.33742,-170.17414,2019 -8.7,11.5,"T-19",2019-08-19 08:08:39,70,3,0,201902,40,143,61.32734,-169.464865,2019 -6.3,11.5,"S-19",2019-08-19 10:40:37,70,3,0,201902,41,143,60.99903,-169.42226,2019 -4.1,11.5,"S-20",2019-08-19 13:10:58,70,3,0,201902,48,143,60.992235,-170.07322,2019 -2.9,11.6,"S-21",2019-08-19 15:51:26,81,3,0,201902,54,143,60.992635,-170.769875,2019 -3.1,11.5,"R-21",2019-08-20 08:18:39,81,3,0,201902,59,143,60.670745,-170.76827,2019 -4.2,11.6,"R-20",2019-08-20 11:14:56,70,3,0,201902,50,143,60.666145,-170.092865,2019 -7.4,7.6,"H-16",2019-06-03 07:26:38,10,3,0,201901,32,98,57.339565,-158.41131,2019 -6.9,6.9,"I-16",2019-06-03 11:57:48,10,3,0,201901,36,98,57.65599,-158.343915,2019 -6.8,7.1,"J-16",2019-06-03 14:59:34,10,3,0,201901,36,98,57.991035,-158.319795,2019 -8.1,9.4,"K-14",2019-06-04 06:55:16,10,3,0,201901,26,98,58.34331,-159.55448,2019 -6.5,7.3,"J-14",2019-06-04 09:54:06,10,3,0,201901,42,98,58.007205,-159.60134,2019 -5.9,7.7,"I-14",2019-06-04 12:41:36,10,3,0,201901,50,98,57.66768,-159.625385,2019 -5.5,7.6,"H-14",2019-06-04 15:46:58,10,3,0,201901,55,98,57.33502,-159.666085,2019 -5.7,7.9,"G-14",2019-06-04 18:18:17,10,3,0,201901,54,98,57.00525,-159.697,2019 -5.2,7.6,"G-13",2019-06-05 07:57:43,31,3,0,201901,63,98,57.00004,-160.334825,2019 -4.8,7.3,"G-12",2019-06-05 10:48:30,31,3,0,201901,66,98,56.996805,-160.946615,2019 -4.6,7.6,"H-12",2019-06-05 13:57:10,31,3,0,201901,63,98,57.335935,-160.927075,2019 -5.1,7.9,"I-12",2019-06-05 17:00:52,31,3,0,201901,56,98,57.66393,-160.881855,2019 -6,8.8,"J-12",2019-06-06 07:00:31,10,3,0,201901,46,98,58.00852,-160.869215,2019 -6.8,9,"K-12",2019-06-06 10:02:42,10,3,1.1,201901,33,98,58.286685,-160.82688,2019 -6.6,9,"K-11",2019-06-06 13:05:15,10,3,0,201901,40,98,58.22118,-161.544645,2019 -6.7,9.5,"K-10",2019-06-06 16:00:40,10,3,0,201901,47,98,58.30581,-162.04421,2019 -6.3,8.6,"J-10",2019-06-06 18:34:53,10,3,0,201901,36,98,57.992125,-162.107245,2019 -6.2,7,"I-10",2019-06-07 06:57:55,10,3,0,201901,47,98,57.67123,-162.12519,2019 -5.7,7,"H-10",2019-06-07 09:30:31,10,3,0,201901,52,98,57.33881,-162.144545,2019 -4.9,7.9,"G-10",2019-06-07 12:22:55,31,3,3.13,201901,61,98,56.99535,-162.164465,2019 -4.6,8.4,"F-10",2019-06-07 15:21:04,31,3,0,201901,71,98,56.665105,-162.18412,2019 -4.4,8.6,"E-10",2019-06-08 08:28:06,31,3,6,201901,78,98,56.33346,-162.189745,2019 -4.9,8.7,"D-10",2019-06-08 11:09:53,31,3,0,201901,74,98,56.00242,-162.282785,2019 -4.9,8.8,"C-09",2019-06-08 14:27:17,10,3,6,201901,51,98,55.6748,-162.8258,2019 -4.9,8.8,"C-08",2019-06-08 16:51:19,31,3,0,201901,80,98,55.65821,-163.421145,2019 -5.4,8.7,"B-08",2019-06-09 06:27:08,31,3,6.3,201901,53,98,55.34477,-163.413285,2019 -5.7,8.5,"B-07",2019-06-09 09:57:05,31,3,0,201901,78,98,55.34299,-164.01873,2019 -5.3,7.5,"B-06",2019-06-09 12:33:16,31,3,0,201901,101,98,55.33744,-164.555105,2019 -5.9,8,"A-06",2019-06-09 15:08:05,31,3,0,201901,64,98,55.043145,-164.578175,2019 -5.9,7.4,"Z-05",2019-06-09 18:24:07,31,3,4.4,201901,83,98,54.703735,-165.14213,2019 -5.1,8.4,"A-05",2019-06-11 06:36:32,50,3,0,201901,112,98,54.999705,-165.159035,2019 -4.9,8.4,"B-05",2019-06-11 09:11:23,50,3,6.3,201901,110,98,55.32119,-165.164915,2019 -4.8,8.9,"C-05",2019-06-11 11:47:30,31,3,0,201901,109,98,55.661495,-165.1725,2019 -5.2,9.2,"C-06",2019-06-11 14:37:39,31,3,0,201901,97,98,55.668895,-164.565195,2019 -5.1,9.3,"C-07",2019-06-11 17:14:38,31,3,6,201901,95,98,55.687125,-164.006615,2019 -4.7,9.3,"D-07",2019-06-12 06:34:34,31,3,0,201901,91,98,56.001385,-164.03945,2019 -4.5,9,"E-07",2019-06-12 09:12:22,31,3,3.1,201901,86,98,56.33301,-164.010565,2019 -4.1,9,"F-07",2019-06-12 11:52:45,31,3,0,201901,75,98,56.66518,-164.013135,2019 -4,8.5,"G-07",2019-06-12 14:25:30,31,3,0,201901,69,98,56.99533,-164.031225,2019 -4,8.7,"H-07",2019-06-13 06:23:45,31,3,0,201901,63,98,57.337265,-164.00222,2019 -6,7.2,"I-07",2019-06-13 09:00:46,10,3,0,201901,52,98,57.655995,-164.009235,2019 -6.1,9,"J-07",2019-06-13 11:37:32,10,3,5.5,201901,48,98,57.98949,-164.01547,2019 -6.2,10.2,"K-07",2019-06-13 14:20:58,10,3,0,201901,41,98,58.325555,-164.007825,2019 -7.5,7.8,"L-07",2019-06-13 16:48:56,10,3,0,201901,34,98,58.661635,-163.98811,2019 -8.1,8.1,"L-08",2019-06-14 06:29:36,10,3,0,201901,32,98,58.67313,-163.343305,2019 -9.3,9.4,"M-08",2019-06-14 09:01:35,10,3,0,201901,23,98,58.986895,-163.34393,2019 -8.1,8.2,"M-07",2019-06-14 11:28:08,10,3,0,201901,27,98,59.00585,-164.001005,2019 -8.2,8.1,"M-06",2019-06-14 13:54:24,10,3,5.5,201901,27,98,58.99485,-164.642005,2019 -7.1,7.8,"L-06",2019-06-14 16:24:02,10,3,0,201901,37,98,58.683295,-164.65094,2019 -6.3,8.9,"K-06",2019-06-15 06:31:47,10,3,0,201901,44,98,58.34169,-164.64511,2019 -6.6,8.3,"J-06",2019-06-15 09:21:07,10,3,0,201901,46,98,58.006375,-164.614155,2019 -5.2,8.5,"I-06",2019-06-15 11:56:25,10,3,0,201901,53,98,57.664385,-164.63374,2019 -3.6,8.3,"H-06",2019-06-15 14:35:35,31,3,0,201901,66,98,57.33372,-164.617605,2019 -4,9.1,"G-06",2019-06-15 17:24:56,31,3,0,201901,69,98,56.999015,-164.613,2019 -3.9,9.2,"F-06",2019-06-16 06:59:59,31,3,0,201901,75,98,56.672795,-164.58112,2019 -4.3,9.3,"E-06",2019-06-16 09:40:14,31,3,0,201901,86,98,56.338075,-164.577915,2019 -4.6,9.6,"D-06",2019-06-16 12:15:32,31,3,0,201901,92,98,55.98851,-164.577115,2019 -4.9,9.3,"D-05",2019-06-16 17:14:05,31,3,0,201901,96,98,55.98287,-165.1891,2019 -4.2,9.6,"E-05",2019-06-17 06:33:11,31,3,0,201901,86,98,56.33626,-165.21135,2019 -4.8,9.3,"E-04",2019-06-17 09:17:42,31,3,0,201901,92,98,56.32362,-165.79827,2019 -4.8,9.2,"D-04",2019-06-17 11:43:28,31,3,0,201901,106,98,56.01064,-165.79303,2019 -4.8,8.7,"C-04",2019-06-17 14:49:03,50,3,3,201901,117,98,55.661835,-165.80351,2019 -5.1,8.3,"B-04",2019-06-17 17:32:35,50,3,3,201901,119,98,55.340175,-165.78715,2019 -4.6,8,"A-04",2019-06-18 06:45:00,50,3,3,201901,130,98,55.005385,-165.74495,2019 -4.5,7.3,"AZ0504",2019-06-18 09:02:08,50,3,3,201901,155,98,54.834445,-165.524455,2019 -4.5,8.5,"A-02",2019-06-23 07:07:54,50,3,3,201901,156,98,55.00346,-166.93235,2019 -4.6,9.1,"B-02",2019-06-23 10:17:51,50,3,3,201901,140,98,55.350625,-166.968165,2019 -4.5,9.7,"C-02",2019-06-23 13:18:33,50,3,3,201901,135,98,55.65915,-166.980275,2019 -4.5,9.6,"D-02",2019-06-23 15:54:10,50,3,3,201901,135,98,55.988015,-167.006615,2019 -4.6,9.7,"E-02",2019-06-24 06:56:15,50,3,0,201901,113,98,56.336775,-167.0286,2019 -4.5,9.9,"F-02",2019-06-24 09:32:46,31,3,0,201901,95,98,56.671915,-167.07288,2019 -4.3,9.5,"G-02",2019-06-24 12:34:53,31,3,0,201901,74,98,57.00089,-167.094,2019 -4.1,9.7,"G-03",2019-06-24 15:52:02,31,3,0,201901,74,98,57.00364,-166.46765,2019 -4,10,"G-04",2019-06-25 06:58:49,31,3,0,201901,72,98,56.99247,-165.84465,2019 -3.7,9.7,"H-04",2019-06-25 09:57:48,31,3,0,201901,68,98,57.33336,-165.866005,2019 -3.8,9.7,"I-04",2019-06-25 12:53:00,31,3,0,201901,64,98,57.667605,-165.87953,2019 -4.8,8.7,"J-04",2019-06-25 15:32:08,10,3,0,201901,56,98,58.001765,-165.900445,2019 -6.6,8.3,"K-04",2019-06-25 18:25:53,10,3,0,201901,44,98,58.314775,-165.91242,2019 -7.7,7.8,"L-04",2019-06-26 07:09:56,10,3,0,201901,37,98,58.65884,-165.93737,2019 -7,7.5,"L-03",2019-06-26 11:13:04,20,3,0,201901,42,98,58.6697,-166.565745,2019 -6,6.7,"L-02",2019-06-26 14:01:30,20,3,0,201901,44,98,58.66974,-167.22477,2019 -6.4,7.3,"M-02",2019-06-26 16:33:38,20,3,0,201901,40,98,58.9959,-167.23006,2019 -6.2,7,"M-01",2019-06-27 06:59:45,20,3,0,201901,42,98,58.99315,-167.896,2019 -6,7.1,"N-01",2019-06-27 09:42:23,20,3,0,201901,40,98,59.32744,-167.90828,2019 -7.2,7.4,"O-01",2019-06-27 12:19:28,20,3,5.5,201901,35,98,59.673225,-167.952435,2019 -7.2,7.2,"P-01",2019-06-27 14:42:38,20,3,0,201901,26,98,59.99753,-167.99829,2019 -5,7.1,"P-18",2019-06-27 17:23:20,20,3,5.5,201901,39,98,59.997175,-168.64673,2019 -8.9,9.1,"Q-02",2019-06-28 06:58:37,20,3,0,201901,31,98,60.336595,-167.257945,2019 -8,8,"Q-01",2019-06-28 09:38:30,20,3,0,201901,32,98,60.334885,-167.97714,2019 -6.1,7.2,"Q-18",2019-06-28 12:05:03,20,3,0,201901,36,98,60.336065,-168.65879,2019 -3.5,8.7,"Q-19",2019-06-28 14:44:40,20,3,0,201901,43,98,60.33717,-169.31331,2019 -5.1,7.8,"O-18",2019-06-29 06:54:00,20,3,0,201901,39,98,59.668125,-168.61609,2019 -5.3,7.6,"N-18",2019-06-29 09:38:20,20,3,0,201901,41,98,59.338415,-168.554795,2019 -5.5,8.4,"M-18",2019-06-29 12:10:42,20,3,0,201901,46,98,59.008685,-168.529175,2019 -4.4,9.6,"L-18",2019-06-29 14:58:06,20,3,0,201901,53,98,58.672935,-168.488675,2019 -3.2,9.6,"L-19",2019-06-29 18:01:39,41,3,0,201901,63,98,58.67059,-169.135165,2019 -3.3,9.6,"K-19",2019-06-30 07:01:39,41,3,0,201901,68,98,58.325565,-169.10778,2019 -3.3,9.2,"J-19",2019-06-30 10:10:07,42,3,0,201901,70,98,57.998925,-169.052045,2019 -3.7,9.4,"JI1918",2019-06-30 12:57:02,42,3,0,201901,70,98,57.82608,-168.737835,2019 -3.9,9.8,"I-19",2019-06-30 15:45:51,42,3,0,201901,69,98,57.663775,-169.034005,2019 -4.2,9.9,"IH2019",2019-06-30 19:29:41,42,3,0,201901,71,98,57.5099,-169.36614,2019 -4.4,9.4,"GF2019",2019-07-01 08:05:15,32,3,5,201901,80,98,56.838385,-169.298225,2019 -5.5,9.4,"GF2120",2019-07-01 11:08:46,42,3,0,201901,72,98,56.836065,-169.902045,2019 -5.8,7.4,"G-21",2019-07-03 11:42:12,42,3,0,201901,65,98,57.01874,-170.20122,2019 -4.9,8.4,"G-22",2019-07-03 14:50:00,42,3,0,201901,95,98,57.000875,-170.788085,2019 -7.2,8,"HG2221",2019-07-03 17:22:37,42,3,5.3,201901,49,98,57.11589,-170.47024,2019 -7.2,8,"HG2120",2019-07-04 07:00:35,42,3,0,201901,53,98,57.156285,-169.84741,2019 -7.2,8.6,"H-21",2019-07-04 09:48:52,42,3,4.5,201901,53,98,57.331325,-170.16671,2019 -4.4,8.5,"IH2120",2019-07-04 11:54:50,42,3,0,201901,69,98,57.501705,-169.987175,2019 -5.4,8.7,"IH2221",2019-07-04 14:53:21,42,3,0,201901,73,98,57.494325,-170.54616,2019 -5.5,9,"H-22",2019-07-04 17:20:59,42,3,0,201901,82,98,57.33899,-170.841735,2019 -4.8,8.7,"I-22",2019-07-05 07:01:37,42,3,0,201901,86,98,57.66848,-170.900175,2019 -4.3,8.7,"JI2221",2019-07-05 09:58:54,42,3,0,201901,78,98,57.835065,-170.61108,2019 -4.1,9.1,"I-21",2019-07-05 13:25:35,42,3,0,201901,72,98,57.670965,-170.28428,2019 -3.7,9,"JI2120",2019-07-05 15:51:16,42,3,0,201901,72,98,57.815155,-170.006615,2019 -4,9,"J-22",2019-07-06 07:01:20,42,3,0,201901,87,98,57.99585,-170.982325,2019 -4,9.1,"J-21",2019-07-06 09:35:26,42,3,0,201901,74,98,58.002205,-170.340425,2019 -3.5,9,"K-21",2019-07-06 11:57:14,41,3,0,201901,74,98,58.32,-170.379245,2019 -3.7,9.1,"K-22",2019-07-06 14:38:02,41,3,0,201901,83,98,58.341925,-171.0144,2019 -3.4,9.2,"L-22",2019-07-06 16:54:50,41,3,0,201901,82,98,58.6585,-171.077795,2019 -3,9.4,"L-21",2019-07-07 07:02:20,41,3,0,201901,73,98,58.672935,-170.432965,2019 -3,9,"M-21",2019-07-07 09:28:57,41,3,0,201901,70,98,59.00371,-170.480575,2019 -2.8,9.9,"M-22",2019-07-07 12:08:17,41,3,0,201901,77,98,58.999705,-171.118205,2019 -2.6,9.2,"N-22",2019-07-07 14:35:24,41,3,0,201901,75,98,59.32573,-171.18238,2019 -2.8,9.3,"N-23",2019-07-08 06:59:38,43,3,0,201901,79,98,59.33174,-171.828855,2019 -3.2,10,"M-23",2019-07-08 09:45:12,41,3,0,201901,87,98,58.997585,-171.786115,2019 -3.6,10.2,"L-23",2019-07-08 12:19:31,41,3,0,201901,92,98,58.669605,-171.71027,2019 -3.7,11.6,"K-23",2019-07-08 15:00:00,41,3,0,201901,96,98,58.33301,-171.648795,2019 -3.9,10.3,"J-23",2019-07-08 17:31:12,41,3,0,201901,97,98,58.00116,-171.59948,2019 -4.3,10.7,"I-23",2019-07-09 07:03:48,41,3,0,201901,99,98,57.659995,-171.53644,2019 -4.4,10.2,"H-23",2019-07-09 09:53:48,41,3,5,201901,100,98,57.34001,-171.473595,2019 -4.6,9.8,"G-23",2019-07-09 12:36:47,61,3,0,201901,109,98,57.007405,-171.39197,2019 -4.4,9.9,"F-23",2019-07-09 15:26:25,61,3,0,201901,119,98,56.67088,-171.34666,2019 -4.3,9.8,"G-26",2019-07-14 07:46:11,61,3,0,201901,141,98,56.99321,-173.232605,2019 -4.3,10.7,"H-26",2019-07-14 10:54:47,61,3,0,201901,120,98,57.32767,-173.29911,2019 -4,11.2,"I-26",2019-07-14 15:49:13,61,3,0,201901,147,98,57.708985,-173.408905,2019 -3.9,11.1,"J-26",2019-07-15 09:31:34,61,3,0,201901,116,98,58.016445,-173.48927,2019 -3.8,10.6,"K-26",2019-07-15 12:23:58,61,3,0,201901,115,98,58.33021,-173.59014,2019 -4,10.9,"K-27",2019-07-15 15:19:19,61,3,0,201901,155,98,58.34423,-174.29394,2019 -3.8,11.3,"L-27",2019-07-15 17:50:42,61,3,0,201901,157,98,58.671315,-174.26988,2019 -3.8,11.5,"L-26",2019-07-16 07:41:19,61,3,0,201901,127,98,58.66677,-173.623615,2019 -3.6,11.6,"M-26",2019-07-16 10:24:29,61,3,0,201901,118,98,58.99066,-173.715865,2019 -3.2,11.4,"N-26",2019-07-16 13:15:20,62,3,0,201901,111,98,59.32022,-173.799355,2019 -3.1,11.4,"ON2625",2019-07-16 15:44:41,43,3,0,201901,103,98,59.483925,-173.50992,2019 -2.9,11.8,"O-26",2019-07-16 18:19:59,62,3,0,201901,105,98,59.668835,-173.854505,2019 -2.7,11.3,"PO2726",2019-07-17 07:40:28,62,3,0,201901,108,98,59.8172,-174.22902,2019 -2.5,11,"QP2726",2019-07-17 10:40:31,43,3,0,201901,101,98,60.14718,-174.35659,2019 -2.5,11.2,"Q-26",2019-07-17 12:48:47,43,3,0,201901,91,98,60.32013,-174.066965,2019 -2.6,11.3,"QP2625",2019-07-17 15:10:46,43,3,0,201901,87,98,60.133465,-173.764885,2019 -2.6,10.8,"P-26",2019-07-17 17:31:36,43,3,0,201901,96,98,60.015595,-173.936695,2019 -2.9,10.8,"O-25",2019-07-18 07:41:08,43,3,0,201901,96,98,59.661225,-173.231685,2019 -2.7,10.5,"PO2625",2019-07-18 10:12:06,43,3,0,201901,95,98,59.83169,-173.5523,2019 -2.4,10.2,"P-25",2019-07-18 12:39:00,43,3,0,201901,75,98,60.004275,-173.269195,2019 -2.5,8.4,"P-24",2019-07-18 15:38:05,43,3,0,201901,67,98,59.9942,-172.669075,2019 -3.6,8,"QP2423",2019-07-18 18:12:18,43,3,0,201901,58,98,60.162575,-172.343215,2019 -2.9,7.1,"QP2524",2019-07-19 07:40:16,43,3,0,201901,60,98,60.16502,-172.99523,2019 -2.8,9.4,"Q-25",2019-07-19 12:07:56,43,3,0,201901,63,98,60.299305,-173.380345,2019 -2.9,9.9,"R-25",2019-07-19 14:58:31,41,3,0,201901,65,98,60.66273,-173.4682,2019 -2.4,10.4,"R-26",2019-07-19 17:59:37,41,3,0,201901,86,98,60.66855,-174.123285,2019 -2.6,10.1,"Q-28",2019-07-20 07:45:12,61,3,0,201901,111,98,60.33795,-175.38835,2019 -3.1,10.2,"P-28",2019-07-20 10:37:15,61,3,0,201901,117,98,60.002235,-175.238685,2019 -3.4,10.2,"O-28",2019-07-20 13:31:50,61,3,0,201901,125,98,59.66951,-175.113535,2019 -3.4,10,"N-28",2019-07-20 16:20:43,61,3,0,201901,131,98,59.33945,-175.09689,2019 -3.2,9.9,"M-30",2019-07-22 07:42:12,61,3,0,201901,137,98,59.016675,-176.299385,2019 -3.6,9.6,"L-30",2019-07-22 11:07:35,61,3,0,201901,139,98,58.66701,-176.18098,2019 -3.4,9.7,"L-31",2019-07-22 13:55:25,61,3,0,201901,136,98,58.662475,-176.810235,2019 -3.5,9.5,"M-32",2019-07-22 18:09:17,61,3,0,201901,134,98,58.99139,-177.53332,2019 -3.3,9.6,"M-31",2019-07-23 07:55:29,61,3,0,201901,136,98,58.998565,-176.938225,2019 -3.2,9.5,"N-31",2019-07-23 10:31:13,61,3,0,201901,149,98,59.327425,-177.05585,2019 -3.3,9.9,"O-31",2019-07-23 13:05:46,61,3,0,201901,176,98,59.65589,-177.1321,2019 -2.7,9.6,"P-32",2019-07-23 18:15:54,61,3,0,201901,141,98,60.00657,-177.89505,2019 -1.8,9.8,"U-29",2019-07-25 14:03:53,90,3,0,201901,104,98,61.681125,-176.450545,2019 -2.2,10,"T-30",2019-07-25 16:59:15,90,3,0,201901,115,98,61.34204,-176.9457,2019 -3,10.1,"R-32",2019-07-26 13:44:07,61,3,0,201901,160,98,60.65082,-178.16562,2019 -1.7,10,"R-31",2019-07-26 16:07:31,61,3,0,201901,148,98,60.668315,-177.537575,2019 -1.5,10.5,"S-31",2019-07-27 07:45:55,90,3,0,201901,136,98,61.000705,-177.648315,2019 -2.3,10.1,"S-30",2019-07-27 10:16:28,90,3,0,201901,122,98,61.007415,-176.978815,2019 -1.9,10.3,"T-29",2019-07-27 13:33:44,90,3,0,201901,106,98,61.327305,-176.30998,2019 -1.6,10.5,"T-28",2019-07-27 15:59:43,90,3,0,201901,98,98,61.33526,-175.679635,2019 -1.5,10.1,"U-28",2019-07-27 18:31:12,82,3,0,201901,95,98,61.65933,-175.765925,2019 -1,10.9,"U-27",2019-07-28 07:37:18,82,3,0,201901,85,98,61.65876,-175.079595,2019 -0.4,10.8,"V-27",2019-07-28 10:12:52,82,3,0,201901,80,98,61.999075,-175.172015,2019 -1.2,10.6,"V-28",2019-07-28 12:37:24,82,3,0,201901,91,98,62.00035,-175.80656,2019 +4.2,4.5,"G-15",2024-06-02 07:15:36,10,3,0,202401,35,98,57.02667,-159.140585,2024 +3.6,3.8,"H-16",2024-06-02 10:48:58,10,3,0,202401,33,98,57.358825,-158.46611,2024 +4,3.9,"I-16",2024-06-02 13:41:05,10,3,0,202401,35,98,57.664895,-158.36291,2024 +3.4,3.6,"J-16",2024-06-02 16:48:23,10,3,0,202401,35,98,57.99211,-158.287675,2024 +2.9,3,"I-14",2024-06-03 10:08:10,10,3,0,202401,51,98,57.65542,-159.611065,2024 +3.2,3.6,"G-14",2024-06-03 15:57:06,10,3,0,202401,54,98,56.9879,-159.71058,2024 +4.1,4.1,"F-14",2024-06-04 07:12:25,10,3,0,202401,39,98,56.699445,-159.79043,2024 +3.3,4,"F-13",2024-06-04 11:05:37,31,3,0,202401,61,98,56.677065,-160.369445,2024 +3,3.1,"G-13",2024-06-04 14:34:00,31,3,0,202401,62,98,56.99746,-160.347825,2024 +2.8,2.9,"H-13",2024-06-05 12:53:21,31,3,0,202401,61,98,57.340245,-160.303585,2024 +3,3.3,"I-13",2024-06-05 15:40:19,31,3,0,202401,53,98,57.657975,-160.277325,2024 +2.8,2.9,"H-11",2024-06-06 11:35:53,31,3,0,202401,56,98,57.323175,-161.533355,2024 +2.7,3.2,"G-11",2024-06-06 14:35:35,31,3,0,202401,68,98,56.99949,-161.57536,2024 +3,4.1,"F-11",2024-06-07 10:33:56,31,3,0,202401,90,98,56.668675,-161.586515,2024 +3.8,4.1,"E-11",2024-06-07 13:38:18,10,3,0,202401,64,98,56.330765,-161.61906,2024 +2.5,2.4,"H-10",2024-06-08 07:09:31,10,3,0,202401,51,98,57.329525,-162.1554,2024 +2.4,2.5,"I-10",2024-06-08 14:48:56,10,3,0,202401,46,98,57.65236,-162.13112,2024 +3,2.9,"H-09",2024-06-09 10:03:48,10,3,0,202401,50,98,57.338485,-162.751815,2024 +2.9,3.1,"I-08",2024-06-10 12:07:44,10,3,0,202401,47,98,57.67579,-163.37932,2024 +3.1,3.5,"H-08",2024-06-10 14:51:08,10,3,0,202401,53,98,57.3377,-163.3816,2024 +2.7,3.8,"H-07",2024-06-11 07:12:31,31,3,0,202401,62,98,57.32974,-164.005365,2024 +2.5,4.5,"G-07",2024-06-11 09:57:31,31,3,0,202401,68,98,57.00512,-164.03519,2024 +3.1,4.5,"G-08",2024-06-11 13:01:06,31,3,0,202401,66,98,57.00696,-163.39423,2024 +2.4,5.1,"F-08",2024-06-11 15:45:20,31,3,0,202401,74,98,56.675725,-163.378685,2024 +2.9,4.5,"F-09",2024-06-12 07:16:38,31,3,0,202401,71,98,56.67318,-162.79239,2024 +2.9,4.9,"E-09",2024-06-12 09:57:57,31,3,0,202401,78,98,56.330995,-162.800615,2024 +3.6,5.8,"D-09",2024-06-12 12:53:34,31,3,0,202401,79,98,55.991815,-162.83022,2024 +3.8,4.6,"D-10",2024-06-12 15:27:58,31,3,0,202401,73,98,56.000085,-162.265665,2024 +4.3,5.8,"C-09",2024-06-13 07:11:08,10,3,0,202401,51,98,55.669555,-162.84062,2024 +3.8,6.2,"C-08",2024-06-13 09:54:55,31,3,0,202401,81,98,55.663915,-163.40441,2024 +3.4,6,"D-08",2024-06-13 12:36:51,31,3,0,202401,88,98,55.996685,-163.390125,2024 +3,5.6,"E-08",2024-06-13 15:12:50,31,3,0,202401,86,98,56.319255,-163.41755,2024 +3,4.8,"F-07",2024-06-14 07:12:35,31,3,0,202401,75,98,56.676535,-164.01583,2024 +3,5.6,"E-07",2024-06-14 09:56:35,31,3,0,202401,86,98,56.34098,-164.010755,2024 +3.6,6.1,"D-07",2024-06-14 12:37:29,31,3,0,202401,91,98,56.01202,-164.04593,2024 +3.7,6.3,"C-07",2024-06-14 15:16:06,31,3,0,202401,94,98,55.70172,-163.988215,2024 +4.3,5.9,"B-08",2024-06-15 07:09:10,31,3,0,202401,53,98,55.33813,-163.419955,2024 +4.3,6,"B-07",2024-06-15 09:59:17,31,3,0,202401,79,98,55.34226,-164.032485,2024 +4.8,6.1,"A-06",2024-06-18 07:26:07,31,3,0,202401,65,98,55.03802,-164.58019,2024 +4,7.5,"B-06",2024-06-18 10:51:00,31,3,0,202401,101,98,55.340965,-164.584445,2024 +4.4,7.3,"B-05",2024-06-18 14:05:23,50,3,0,202401,111,98,55.33487,-165.171085,2024 +4,6.8,"C-05",2024-06-18 16:44:57,31,3,0,202401,109,98,55.64179,-165.179785,2024 +3.9,7.7,"D-05",2024-06-19 07:07:16,31,3,0,202401,97,98,55.99192,-165.18467,2024 +3.6,7.8,"E-05",2024-06-19 10:13:11,31,3,0,202401,87,98,56.32921,-165.20127,2024 +3.3,8.4,"F-05",2024-06-19 13:01:20,31,3,0,202401,75,98,56.663115,-165.22412,2024 +3.4,7.9,"G-05",2024-06-19 15:40:13,31,3,0,202401,71,98,56.99093,-165.23024,2024 +3,7.4,"H-05",2024-06-20 07:05:34,31,3,0,202401,67,98,57.339045,-165.23377,2024 +2.6,6.9,"I-05",2024-06-20 09:49:16,31,3,0,202401,62,98,57.66026,-165.252765,2024 +2.7,6.3,"J-05",2024-06-20 12:43:31,10,3,0,202401,50,98,58.00232,-165.229615,2024 +3.1,6.1,"J-06",2024-06-20 15:29:54,10,3,0,202401,45,98,58.000255,-164.633545,2024 +2.9,5.7,"K-06",2024-06-21 07:04:41,10,3,0,202401,45,98,58.33517,-164.641995,2024 +2.5,5.6,"K-05",2024-06-21 09:52:52,10,3,0,202401,46,98,58.333745,-165.273865,2024 +2.5,6.1,"L-05",2024-06-21 12:40:33,10,3,0,202401,40,98,58.65937,-165.291085,2024 +3.5,5,"L-06",2024-06-21 15:33:41,10,3,0,202401,37,98,58.664985,-164.665495,2024 +4.7,5.2,"M-06",2024-06-22 07:03:28,10,3,0,202401,28,98,58.9876,-164.651675,2024 +5.7,7,"N-06",2024-06-22 09:34:49,10,3,0,202401,23,98,59.33168,-164.65962,2024 +5.4,5.4,"N-05",2024-06-22 12:15:02,20,3,0,202401,22,98,59.332985,-165.306015,2024 +4.9,5,"N-04",2024-06-22 14:40:31,20,3,0,202401,25,98,59.332635,-165.93776,2024 +3.7,3.8,"N-03",2024-06-23 07:01:46,20,3,0,202401,28,98,59.33962,-166.600345,2024 +4.1,4.1,"M-03",2024-06-23 09:38:46,20,3,0,202401,34,98,59.01233,-166.57744,2024 +2.1,5,"L-03",2024-06-23 12:18:57,20,3,0,202401,41,98,58.678865,-166.56293,2024 +1.8,5.6,"K-03",2024-06-23 15:05:19,10,3,0,202401,47,98,58.33653,-166.562545,2024 +3.2,8.7,"F-03",2024-06-24 07:04:51,31,3,0,202401,85,98,56.662055,-166.437835,2024 +3.9,8.6,"E-03",2024-06-24 09:51:37,31,3,0,202401,104,98,56.32899,-166.41313,2024 +3.9,8.7,"D-03",2024-06-24 12:32:06,50,3,0,202401,124,98,55.997275,-166.40984,2024 +4.1,8.8,"C-03",2024-06-24 15:05:23,50,3,0,202401,126,98,55.675895,-166.39333,2024 +3.1,8.4,"G-03",2024-06-25 07:03:38,31,3,0,202401,74,98,56.995925,-166.46256,2024 +2.8,6.7,"H-03",2024-06-25 09:47:01,31,3,0,202401,70,98,57.33559,-166.48555,2024 +2.7,6.8,"I-03",2024-06-25 12:32:19,31,3,0,202401,67,98,57.660605,-166.50083,2024 +2.9,5.3,"H-02",2024-06-26 07:04:18,31,3,0,202401,71,98,57.342685,-167.147005,2024 +2.5,4.6,"I-02",2024-06-26 10:30:00,31,3,0,202401,68,98,57.677215,-167.14485,2024 +1.8,4.7,"J-03",2024-06-26 16:29:24,31,3,0,202401,61,98,57.999575,-166.550895,2024 +1.8,3.6,"K-01",2024-06-27 07:00:21,41,3,0,202401,60,98,58.323775,-167.842185,2024 +2.7,3.3,"L-01",2024-06-27 10:47:53,20,3,0,202401,47,98,58.667145,-167.882535,2024 +3.4,3.3,"M-01",2024-06-28 07:02:19,20,3,0,202401,42,98,58.990345,-167.908565,2024 +3.1,3,"N-01",2024-06-28 10:19:58,20,3,0,202401,39,98,59.32064,-167.922135,2024 +3.6,3.7,"O-01",2024-06-29 07:03:02,20,3,0,202401,36,98,59.665165,-167.96704,2024 +3.7,3.6,"P-01",2024-06-29 09:52:59,20,3,0,202401,25,98,59.986945,-167.99501,2024 +4.8,5.5,"Q-01",2024-06-29 12:44:31,20,3,0,202401,32,98,60.337465,-167.99063,2024 +5.4,5.4,"Q-02",2024-06-29 15:29:20,20,3,0,202401,31,98,60.336115,-167.266205,2024 +1.8,2.1,"P-19",2024-06-30 07:00:35,20,3,0,202401,46,98,60.003815,-169.32454,2024 +2.5,2.6,"O-19",2024-06-30 09:34:58,20,3,0,202401,47,98,59.679475,-169.27622,2024 +2.6,3.3,"N-19",2024-06-30 12:18:03,20,3,0,202401,50,98,59.34784,-169.24497,2024 +0.6,3.8,"N-20",2024-06-30 15:05:56,41,3,0,202401,61,98,59.337725,-169.88018,2024 +2.6,3.6,"M-19",2024-07-01 07:13:32,41,3,0,202401,54,98,59.012005,-169.17384,2024 +1.9,4.2,"L-19",2024-07-01 10:03:10,41,3,0,202401,62,98,58.665165,-169.167515,2024 +1.6,3.7,"L-20",2024-07-01 12:55:32,41,3,0,202401,67,98,58.670385,-169.825565,2024 +0.4,4.5,"L-21",2024-07-01 16:11:07,41,3,0,202401,74,98,58.66899,-170.45196,2024 +0.6,4.8,"K-21",2024-07-02 07:00:12,41,3,0,202401,74,98,58.3305,-170.386525,2024 +0.6,4.9,"J-21",2024-07-02 10:30:08,42,3,0,202401,74,98,58.00055,-170.32673,2024 +1.7,5.3,"J-20",2024-07-02 13:37:38,42,3,0,202401,70,98,58.00022,-169.69412,2024 +1.7,5.6,"I-20",2024-07-02 16:42:25,42,3,0,202401,71,98,57.663815,-169.646285,2024 +1.2,4.9,"I-21",2024-07-03 07:01:37,42,3,0,202401,73,98,57.66549,-170.2594,2024 +3.7,4.4,"H-21",2024-07-03 12:39:19,42,3,0,202401,55,98,57.33382,-170.228255,2024 +1.6,4.7,"H-20",2024-07-03 15:38:35,42,3,0,202401,63,98,57.341895,-169.623945,2024 +2.2,2.5,"G-20",2024-07-04 07:00:05,42,3,0,202401,62,98,56.99735,-169.541185,2024 +4,5.7,"F-20",2024-07-04 12:34:30,32,3,0,202401,79,98,56.672345,-169.512675,2024 +3.3,6.5,"F-19",2024-07-04 15:35:38,32,3,0,202401,99,98,56.675425,-168.915045,2024 +3.9,6.7,"E-19",2024-07-05 10:01:21,50,3,0,202401,129,98,56.333935,-168.8793,2024 +4,7.4,"C-18",2024-07-06 07:01:43,50,3,0,202401,137,98,55.66771,-168.177185,2024 +3.9,7.7,"C-01",2024-07-06 10:12:26,50,3,0,202401,135,98,55.65978,-167.58632,2024 +3.9,7.3,"B-01",2024-07-06 12:47:08,50,3,0,202401,146,98,55.34627,-167.54205,2024 +3.8,8.4,"A-02",2024-07-06 16:42:33,50,3,0,202401,155,98,55.009745,-166.94512,2024 +3.9,7.6,"B-02",2024-07-07 07:06:45,50,3,0,202401,140,98,55.333825,-166.952855,2024 +4,7.8,"B-03",2024-07-07 10:04:45,50,3,0,202401,132,98,55.339635,-166.34736,2024 +3.9,8.2,"A-03",2024-07-07 12:48:46,50,3,0,202401,142,98,55.01761,-166.32564,2024 +4.3,7.4,"A-04",2024-07-07 15:49:09,50,3,1.12,202401,130,98,54.998625,-165.751935,2024 +3.9,5,"E-21",2024-07-11 07:35:03,50,3,0,202401,110,98,56.34758,-170.07738,2024 +3.8,6.1,"F-21",2024-07-11 11:03:08,42,3,0,202401,97,98,56.67025,-170.115525,2024 +3.8,4.2,"G-21",2024-07-11 14:02:29,42,3,0,202401,68,98,57.004665,-170.16301,2024 +2.8,7.1,"G-23",2024-07-12 07:37:00,61,3,0,202401,110,98,56.995435,-171.38766,2024 +2.7,7,"H-23",2024-07-12 11:56:42,41,3,0,202401,102,98,57.3309,-171.465835,2024 +2,7.2,"I-23",2024-07-12 14:54:19,41,3,1.12,202401,100,98,57.65023,-171.53237,2024 +1.6,7,"J-23",2024-07-12 17:43:23,41,3,0,202401,98,98,57.98725,-171.59457,2024 +1.3,6.6,"K-23",2024-07-13 07:35:09,41,3,0,202401,96,98,58.33113,-171.65338,2024 +0.9,6.4,"L-23",2024-07-13 10:24:18,41,3,0,202401,93,98,58.657515,-171.719075,2024 +0.5,6.2,"M-23",2024-07-13 13:06:35,41,3,0,202401,88,98,58.995255,-171.780515,2024 +-0.1,5.9,"N-23",2024-07-13 15:52:40,43,3,0,202401,81,98,59.32721,-171.831655,2024 +-0.5,5.5,"N-22",2024-07-14 07:41:04,41,3,0,202401,75,98,59.32789,-171.170985,2024 +-0.2,5.6,"O-23",2024-07-14 13:34:27,43,3,0,202401,78,98,59.6663,-171.8923,2024 +0.6,3.8,"Q-25",2024-07-15 07:40:25,43,3,0,202401,63,98,60.294685,-173.37399,2024 +0.4,5.7,"P-25",2024-07-15 09:57:17,43,3,0,202401,75,98,60.007985,-173.285785,2024 +-0.1,5,"P-24",2024-07-15 12:46:50,43,3,0,202401,67,98,59.990855,-172.594695,2024 +-0.4,6.1,"Q-23",2024-07-15 16:01:41,43,3,0,202401,59,98,60.329685,-172.06366,2024 +-1.3,6.2,"R-23",2024-07-16 07:36:27,41,3,0,202401,62,98,60.66331,-172.09063,2024 +2.5,6,"R-24",2024-07-16 10:26:55,41,3,0,202401,45,98,60.66979,-172.759305,2024 +0.4,6.8,"R-25",2024-07-17 07:35:44,41,3,0,202401,65,98,60.66667,-173.471775,2024 +1.1,6.8,"R-26",2024-07-17 10:22:08,41,3,0,202401,86,98,60.670955,-174.132245,2024 +0.7,6.7,"S-26",2024-07-17 12:59:00,41,3,0,202401,83,98,60.997075,-174.189045,2024 +0.8,6.7,"T-26",2024-07-17 15:39:54,82,3,0,202401,78,98,61.332835,-174.335405,2024 +1,6.1,"U-27",2024-07-18 07:35:13,82,3,0,202401,85,98,61.663205,-175.075535,2024 +0.9,5.8,"V-27",2024-07-18 10:28:31,82,3,0,202401,81,98,61.994765,-175.187575,2024 +0.9,6,"U-29",2024-07-19 07:37:04,90,3,0,202401,105,98,61.6632,-176.461455,2024 +1,6,"T-29",2024-07-19 10:29:58,90,3,0,202401,107,98,61.332685,-176.321675,2024 +1.3,6.4,"T-30",2024-07-19 13:07:13,90,3,0,202401,115,98,61.3372,-176.96549,2024 +0.9,7.1,"S-31",2024-07-19 16:51:12,90,3,0,202401,135,98,60.997025,-177.638415,2024 +0.9,6.7,"S-30",2024-07-20 07:40:03,90,3,0,202401,122,98,61.00753,-176.966795,2024 +1.2,6.5,"S-29",2024-07-20 11:12:26,90,3,0,202401,112,98,60.998605,-176.29293,2024 +1.3,7.2,"R-29",2024-07-20 14:36:54,61,3,0,202401,118,98,60.66905,-176.227565,2024 +1,7.4,"R-30",2024-07-21 07:38:24,61,3,0,202401,130,98,60.67018,-176.81101,2024 +0.9,7.5,"Q-30",2024-07-21 10:55:20,61,3,0,202401,137,98,60.338085,-176.71376,2024 +1.6,7.1,"Q-29",2024-07-21 14:02:43,61,3,0,202401,122,98,60.32975,-176.051885,2024 +1.5,7.2,"Q-28",2024-07-21 16:57:00,61,3,0,202401,111,98,60.336445,-175.40425,2024 +1.7,7.5,"P-28",2024-07-23 07:42:31,61,3,0,202401,117,98,60.00738,-175.26588,2024 +2.1,7.6,"O-28",2024-07-23 11:28:42,61,3,0,202401,126,98,59.669375,-175.13382,2024 +1.6,7.8,"O-29",2024-07-23 14:27:45,61,3,0,202401,136,98,59.66968,-175.864155,2024 +1.9,7.6,"P-29",2024-07-23 17:14:08,61,3,1.12,202401,129,98,59.984545,-175.92399,2024 +1,7.7,"P-30",2024-07-24 07:36:48,61,3,0,202401,142,98,60.005345,-176.71579,2024 +1.3,7.8,"O-30",2024-07-24 10:29:41,61,3,0,202401,137,98,59.67927,-176.53975,2024 +1.2,7.7,"N-30",2024-07-24 13:22:21,61,3,0,202401,136,98,59.348725,-176.387825,2024 +1.9,7.9,"M-30",2024-07-24 16:12:32,61,3,0,202401,135,98,59.00671,-176.31035,2024 +3.1,8.1,"M-32",2024-07-25 07:41:45,61,3,0,202401,135,98,58.99927,-177.61918,2024 +2.6,7.9,"M-31",2024-07-25 10:36:29,61,3,0,202401,136,98,58.99311,-176.95106,2024 +2.8,8.2,"L-31",2024-07-25 13:21:37,61,3,0,202401,135,98,58.67371,-176.828595,2024 +2.4,8.4,"L-30",2024-07-25 15:58:27,61,3,0,202401,140,98,58.66745,-176.21763,2024 +2.7,7.9,"M-28",2024-07-26 07:37:08,61,3,0,202401,130,98,59.010625,-175.022275,2024 +2.2,8,"M-27",2024-07-26 10:21:59,61,3,0,202401,127,98,59.003245,-174.37167,2024 +1.8,8.1,"M-26",2024-07-26 13:07:51,61,3,0,202401,118,98,59.00344,-173.716125,2024 +2.4,8.2,"L-26",2024-07-26 15:56:07,61,3,0,202401,126,98,58.68028,-173.63641,2024 +2,8.2,"L-25",2024-07-27 07:33:35,61,3,0,202401,113,98,58.668495,-173.00771,2024 +1.7,8,"L-24",2024-07-27 10:33:38,61,3,0,202401,102,98,58.669155,-172.36943,2024 +1.9,8.3,"K-24",2024-07-27 14:43:23,61,3,0,202401,103,98,58.31751,-172.305235,2024 +2.1,8.3,"J-24",2024-07-27 17:26:17,61,3,0,202401,105,98,58.003415,-172.256595,2024 +3.2,8.3,"H-26",2024-07-28 07:41:41,61,3,0,202401,122,98,57.32448,-173.339375,2024 +3,8.3,"H-25",2024-07-28 10:24:12,61,3,0,202401,117,98,57.351085,-172.812795,2024 +2.8,8.2,"H-24",2024-07-28 13:47:26,61,3,0,202401,109,98,57.33674,-172.081525,2024 +3.7,8.3,"F-25",2024-07-29 08:08:06,61,3,0,202401,135,98,56.67495,-172.560765,2024 +3.6,8,"F-24",2024-07-29 11:10:16,61,3,0,202401,126,98,56.66735,-171.97018,2024 +3.3,8.3,"G-24",2024-07-29 14:37:32,61,3,0,202401,118,98,56.99549,-172.03074,2024 +4.1,8.2,"E-20",2024-07-30 07:54:04,50,3,0,202401,138,98,56.33889,-169.324885,2024 +2.4,8.7,"N-31",2024-08-04 08:43:09,61,3,0,202401,149,98,59.336835,-177.026545,2024 +3.6,8.7,"O-31",2024-08-04 11:56:54,61,3,0,202401,176,98,59.659545,-177.14104,2024 +1.8,8.9,"P-32",2024-08-04 16:31:49,61,3,0,202401,141,98,60.022165,-177.8714,2024 +1.1,8.7,"P-31",2024-08-05 08:42:21,61,3,0,202401,137,98,60.000365,-177.19938,2024 +1.5,8.8,"Q-31",2024-08-05 11:50:50,61,3,0,202401,147,98,60.32688,-177.374215,2024 +0.8,8.8,"R-31",2024-08-05 15:09:09,61,3,0,202401,147,98,60.664945,-177.523365,2024 +2.5,8.8,"R-32",2024-08-05 18:33:31,61,3,0,202401,159,98,60.64997,-178.14495,2024 +-1.6,10.1,"W-27",2023-08-03 14:16:52,81,3,0,202302,78,143,62.333175,-175.274615,2023 +-1.6,9.9,"W-26",2023-08-03 17:10:27,81,3,0,202302,70,143,62.32472,-174.577415,2023 +2.7,9.4,"AA-22",2023-08-04 08:14:19,70,3,0,202302,37,143,63.54793,-172.005705,2023 +-0.1,9.8,"BB-22",2023-08-04 11:28:47,71,3,4.1,202302,53,143,64.01139,-172.00107,2023 +1.4,9.8,"BB-21",2023-08-04 14:33:54,71,3,0,202302,28,143,63.999665,-171.338195,2023 +8.7,8.9,"AA-21",2023-08-04 17:55:20,71,3,4.1,202302,21,143,63.69833,-171.06283,2023 +1.6,4,"BB-20",2023-08-05 13:30:30,71,3,0,202302,30,143,63.99256,-170.542745,2023 +3.2,5.9,"BB-19",2023-08-05 17:52:54,71,3,0,202302,34,143,63.989585,-169.78633,2023 +7.7,9.1,"AA-19",2023-08-06 08:12:48,71,3,0,202302,40,143,63.66424,-169.76115,2023 +2.7,8.7,"AA-18",2023-08-06 11:16:30,71,3,0,202302,36,143,63.667625,-169.03946,2023 +2.4,7.9,"BB-18",2023-08-06 13:53:54,71,3,0,202302,36,143,64.0034,-169.05327,2023 +1.5,7.1,"CC-18",2023-08-06 18:05:53,71,3,0,202302,40,143,64.311145,-169.095205,2023 +1.3,7.1,"DD-18",2023-08-07 08:08:48,71,3,4.5,202302,43,143,64.667855,-169.14426,2023 +1.7,5,"DD-19",2023-08-07 11:20:04,71,3,0,202302,47,143,64.65517,-169.907815,2023 +0.7,4.5,"CC-19",2023-08-07 13:58:08,71,3,0,202302,40,143,64.33681,-169.844335,2023 +1,7.1,"CC-20",2023-08-07 16:38:20,71,3,2.4,202302,37,143,64.335485,-170.5984,2023 +2.6,8.4,"CC-21",2023-08-07 19:53:26,71,3,0,202302,40,143,64.238655,-171.08973,2023 +2.1,7.1,"DD-20",2023-08-08 08:09:51,71,3,0,202302,48,143,64.648075,-170.61273,2023 +1.2,6.9,"EE-19",2023-08-08 11:26:30,71,3,0,202302,48,143,64.97509,-169.874555,2023 +1.3,8.1,"EE-18",2023-08-08 13:58:57,71,3,0,202302,49,143,65.00504,-169.124595,2023 +2.2,8.9,"FF-18",2023-08-08 18:23:00,71,3,0,202302,53,143,65.22058,-168.89404,2023 +4,9.6,"FF-01",2023-08-09 08:06:03,71,3,0,202302,53,143,65.334355,-168.380475,2023 +8.7,9.1,"FF-02",2023-08-09 11:14:11,71,3,0,202302,38,143,65.309555,-167.671965,2023 +7.7,7.8,"EE-02",2023-08-09 14:25:56,71,3,0,202302,34,143,65.00305,-167.634765,2023 +2.2,9.1,"EE-01",2023-08-09 17:16:13,71,3,0,202302,45,143,64.998255,-168.35851,2023 +1.7,8.4,"DD-01",2023-08-10 08:08:27,71,3,4.5,202302,39,143,64.665385,-168.339855,2023 +7,8.3,"DD-02",2023-08-10 12:07:14,71,3,0,202302,31,143,64.66966,-167.623415,2023 +9.9,12.8,"DD-03",2023-08-10 14:49:20,71,3,0,202302,24,143,64.687975,-166.861775,2023 +7.5,9.2,"CC-03",2023-08-10 18:02:16,71,3,0,202302,30,143,64.335255,-166.830965,2023 +6.2,8.2,"CC-02",2023-08-11 08:04:58,71,3,0,202302,31,143,64.343155,-167.564375,2023 +1.3,8,"CC-01",2023-08-11 12:09:14,71,3,0,202302,39,143,64.326695,-168.33837,2023 +1.6,9.3,"BB-01",2023-08-11 14:31:00,71,3,0,202302,36,143,64.012625,-168.303565,2023 +2.8,5.4,"AA-01",2023-08-11 17:00:29,71,3,0,202302,33,143,63.685195,-168.2721,2023 +3,7.6,"Y-01",2023-08-12 08:05:52,70,3,0,202302,39,143,63.010525,-168.216655,2023 +2.1,8.3,"Y-18",2023-08-12 10:48:24,70,3,0,202302,39,143,62.868295,-168.83146,2023 +0.8,8.3,"X-19",2023-08-12 13:47:06,70,3,0,202302,40,143,62.672485,-169.580125,2023 +0.2,8.2,"X-20",2023-08-12 16:36:34,70,3,0,202302,42,143,62.67057,-170.337955,2023 +0,8.4,"Y-21",2023-08-13 08:05:52,70,3,0,202302,47,143,62.99212,-171.129155,2023 +-0.8,7.9,"Y-22",2023-08-13 10:53:48,70,3,0,202302,52,143,62.98291,-171.796425,2023 +0,7.8,"ZZ-23",2023-08-13 15:29:54,81,3,0,202302,63,143,63.325215,-172.58325,2023 +-1.3,8.2,"ZZ-24",2023-08-13 18:12:37,81,3,0,202302,70,143,63.339365,-173.382295,2023 +-1.5,8.1,"Y-25",2023-08-14 08:23:34,81,3,0,202302,74,143,62.9977,-174.01748,2023 +-1.6,8.6,"X-25",2023-08-14 11:05:02,81,3,0,202302,68,143,62.64986,-173.9089,2023 +-1.5,9.5,"X-24",2023-08-15 13:03:43,81,3,1.12,202302,65,143,62.66809,-173.266645,2023 +-1.1,9.2,"X-23",2023-08-15 15:28:45,81,3,0,202302,54,143,62.66519,-172.5057,2023 +-0.7,9.1,"W-23",2023-08-16 08:21:12,81,3,0,202302,54,143,62.332475,-172.420025,2023 +-0.4,8.6,"W-22",2023-08-16 10:47:40,81,3,0,202302,47,143,62.33095,-171.745325,2023 +0.2,8.9,"W-21",2023-08-16 13:10:38,70,3,5.8,202302,42,143,62.331915,-171.05822,2023 +0.9,8.7,"W-20",2023-08-16 15:46:21,70,3,0,202302,40,143,62.33869,-170.315925,2023 +0.6,9,"V-20",2023-08-16 18:26:59,70,3,0,202302,46,143,62.000045,-170.261115,2023 +0.3,8.8,"V-21",2023-08-17 08:17:10,70,3,0,202302,50,143,62.00501,-170.9444,2023 +-0.2,9.4,"V-22",2023-08-17 11:15:01,70,3,0,202302,52,143,62.002845,-171.61872,2023 +-0.8,9.3,"V-23",2023-08-17 14:16:10,81,3,0,202302,55,143,62.001605,-172.33696,2023 +-1.1,9.6,"V-24",2023-08-17 17:13:35,81,3,0,202302,58,143,62.006165,-173.052805,2023 +-1,8.3,"T-24",2023-08-18 08:29:26,81,3,0,202302,69,143,61.33713,-172.93205,2023 +-0.8,8.9,"T-23",2023-08-18 11:00:01,81,3,0,202302,63,143,61.333845,-172.26464,2023 +-0.3,8,"T-22",2023-08-18 13:42:41,81,3,0,202302,56,143,61.333615,-171.527505,2023 +-0.1,9.2,"U-22",2023-08-18 16:27:08,81,3,0,202302,55,143,61.653885,-171.581645,2023 +0.3,8.6,"U-21",2023-08-18 19:05:07,81,3,0,202302,50,143,61.667885,-170.89998,2023 +-0.8,9.2,"S-21",2023-08-19 08:26:43,81,3,0,202302,54,143,61.003975,-170.821735,2023 +0.1,8.2,"T-20",2023-08-19 11:43:59,70,3,0,202302,47,143,61.334315,-170.173255,2023 +3.4,7.5,"T-19",2023-08-19 14:30:17,70,3,0,202302,40,143,61.335715,-169.448875,2023 +7.9,8.2,"S-18",2023-08-19 18:04:38,70,3,0,202302,36,143,61.02178,-168.73981,2023 +1.6,9,"R-20",2023-08-20 08:18:54,70,3,0,202302,49,143,60.6709,-170.053705,2023 +4.1,7.6,"R-19",2023-08-20 10:57:59,70,3,0,202302,43,143,60.67695,-169.368495,2023 +4,4.2,"E-12",2023-05-28 15:56:41,10,3,0,202301,54,98,56.33815,-161.01849,2023 +3.7,3.7,"F-13",2023-05-29 10:48:20,31,3,0,202301,59,98,56.66523,-160.36954,2023 +4.6,4.7,"F-14",2023-05-29 14:17:28,10,3,0,202301,37,98,56.678295,-159.75818,2023 +3.7,3.8,"G-14",2023-05-29 17:51:52,10,3,0,202301,54,98,56.99096,-159.67598,2023 +3.6,3.9,"H-14",2023-05-30 07:29:17,10,3,0,202301,56,98,57.34045,-159.650505,2023 +3.5,3.5,"I-14",2023-05-30 10:10:42,10,3,0,202301,50,98,57.65895,-159.62963,2023 +3,4.2,"J-14",2023-05-30 13:05:06,10,3,0,202301,42,98,58.0015,-159.612765,2023 +3.1,3.9,"K-14",2023-05-30 15:42:23,10,3,0,202301,25,98,58.312185,-159.569145,2023 +3.4,3.8,"K-12",2023-05-31 09:46:56,10,3,1.1,202301,32,98,58.28491,-160.80851,2023 +2.6,3.2,"J-12",2023-05-31 11:56:03,10,3,0,202301,45,98,58.011675,-160.873295,2023 +3,3.5,"I-12",2023-05-31 15:10:17,31,3,0,202301,56,98,57.673075,-160.895435,2023 +3,3.6,"H-12",2023-06-01 07:29:22,31,3,0,202301,62,98,57.337925,-160.938915,2023 +3.1,3.2,"H-11",2023-06-01 10:24:16,31,3,0,202301,56,98,57.330895,-161.53269,2023 +3.3,3.4,"G-11",2023-06-01 13:04:01,31,3,0,202301,68,98,57.002485,-161.56328,2023 +3,3.2,"G-10",2023-06-01 15:42:43,31,3,0,202301,60,98,57.00094,-162.165025,2023 +3.1,3.6,"I-11",2023-06-02 07:26:34,10,3,0,202301,53,98,57.666255,-161.502455,2023 +2.7,3.3,"J-11",2023-06-02 09:58:03,10,3,0,202301,54,98,57.992995,-161.48269,2023 +3,3.8,"K-11",2023-06-02 12:21:35,10,3,0,202301,41,98,58.228505,-161.54849,2023 +2.7,3.5,"K-10",2023-06-02 14:46:53,10,3,0,202301,47,98,58.320535,-162.05581,2023 +2.9,2.8,"J-10",2023-06-03 07:27:27,10,3,0,202301,40,98,58.009425,-162.13323,2023 +2.5,2.5,"J-09",2023-06-03 10:17:46,10,3,0,202301,42,98,57.995265,-162.75119,2023 +2.7,2.8,"K-09",2023-06-04 11:52:56,10,3,0,202301,33,98,58.329165,-162.71882,2023 +2.9,3,"L-09",2023-06-04 14:26:55,10,3,0,202301,27,98,58.63519,-162.707725,2023 +3.8,3.7,"M-08",2023-06-05 07:21:36,10,3,0,202301,20,98,58.99032,-163.37137,2023 +3,2.9,"M-07",2023-06-05 09:51:44,10,3,0,202301,29,98,59.006115,-164.014705,2023 +4.8,4.9,"N-07",2023-06-05 12:21:25,10,3,0,202301,23,98,59.33511,-164.010375,2023 +3.5,3.5,"N-06",2023-06-05 14:54:41,10,3,0,202301,23,98,59.33083,-164.66042,2023 +2.9,2.8,"M-06",2023-06-06 07:21:13,10,3,0,202301,27,98,58.998605,-164.62915,2023 +1.8,1.7,"L-06",2023-06-06 10:38:38,10,3,0,202301,38,98,58.683395,-164.65786,2023 +1.6,2,"K-06",2023-06-06 13:47:16,10,3,0,202301,44,98,58.33459,-164.64496,2023 +1.9,2.4,"K-07",2023-06-06 16:55:13,10,3,0,202301,44,98,58.32943,-164.058645,2023 +1.5,2.2,"J-07",2023-06-07 07:23:17,10,3,0,202301,46,98,58.00824,-164.02516,2023 +1,2.8,"I-07",2023-06-07 10:09:16,10,3,0,202301,49,98,57.670775,-164.00704,2023 +1.6,4.5,"H-07",2023-06-07 13:01:45,31,3,0,202301,62,98,57.32386,-164.00821,2023 +2.8,5.3,"G-07",2023-06-07 15:33:27,31,3,0,202301,67,98,57.00155,-164.03446,2023 +1.7,4.2,"H-08",2023-06-08 07:24:07,10,3,0,202301,53,98,57.33672,-163.39175,2023 +2.7,5.1,"G-08",2023-06-08 10:05:05,31,3,0,202301,66,98,56.99656,-163.398165,2023 +3.3,5.9,"F-08",2023-06-08 12:42:58,31,3,0,202301,75,98,56.66744,-163.395155,2023 +3.1,6.5,"E-08",2023-06-08 15:23:29,31,3,1.1,202301,84,98,56.32736,-163.41756,2023 +3.3,6.6,"D-08",2023-06-09 07:21:39,31,3,0,202301,88,98,55.995625,-163.390825,2023 +3.7,6.3,"C-08",2023-06-09 09:57:19,31,3,0,202301,82,98,55.67166,-163.400095,2023 +4.5,6.3,"B-08",2023-06-09 12:40:41,31,3,0,202301,54,98,55.337865,-163.42151,2023 +5.4,5.6,"Z-05",2023-06-12 07:26:00,31,3,3,202301,81,98,54.672745,-165.13774,2023 +4.3,5.9,"AZ0504",2023-06-12 14:50:27,50,3,0,202301,155,98,54.832875,-165.517775,2023 +4.4,6.5,"B-04",2023-06-12 18:51:08,50,3,0,202301,120,98,55.338335,-165.78311,2023 +4.3,6.9,"C-04",2023-06-13 07:27:19,50,3,0,202301,118,98,55.671155,-165.804025,2023 +4.3,6.3,"D-04",2023-06-13 10:12:51,31,3,0,202301,107,98,56.008555,-165.78839,2023 +4.2,6.3,"D-05",2023-06-13 13:14:42,31,3,0,202301,96,98,56.006425,-165.17988,2023 +3.5,6.4,"E-05",2023-06-13 15:53:36,31,3,0,202301,87,98,56.344285,-165.19915,2023 +3.2,6.2,"F-05",2023-06-14 07:23:43,31,3,4.1,202301,76,98,56.670125,-165.20474,2023 +2.6,5.6,"G-05",2023-06-14 10:13:32,31,3,0,202301,70,98,56.99937,-165.222725,2023 +2.2,5.6,"H-05",2023-06-14 12:51:52,31,3,0,202301,66,98,57.3273,-165.23679,2023 +0.6,4.9,"I-05",2023-06-14 15:29:36,31,3,0,202301,60,98,57.67649,-165.25134,2023 +0.5,4.3,"J-05",2023-06-15 07:48:35,10,3,0,202301,51,98,58.001315,-165.246835,2023 +2.2,2.3,"K-05",2023-06-15 10:26:08,10,3,0,202301,45,98,58.335605,-165.292095,2023 +2.3,2.4,"L-05",2023-06-15 13:17:38,10,3,0,202301,40,98,58.65731,-165.30858,2023 +3.2,3.4,"M-05",2023-06-15 15:57:58,10,3,0,202301,27,98,59.00384,-165.30189,2023 +4.3,4.3,"N-05",2023-06-16 07:16:44,20,3,0,202301,21,98,59.337195,-165.296845,2023 +3.7,3.6,"N-04",2023-06-16 10:17:15,20,3,0,202301,25,98,59.33154,-165.948895,2023 +4.6,4.8,"O-04",2023-06-16 13:09:24,20,3,0,202301,26,98,59.611345,-165.925455,2023 +3,3,"O-03",2023-06-16 15:52:30,20,3,0,202301,27,98,59.666035,-166.614235,2023 +3.8,3.8,"N-03",2023-06-17 07:21:54,20,3,0,202301,28,98,59.346275,-166.58836,2023 +2.8,2.8,"N-02",2023-06-17 10:15:35,20,3,0,202301,32,98,59.345245,-167.24722,2023 +2.2,2.2,"M-02",2023-06-17 12:52:37,20,3,0,202301,40,98,59.00401,-167.243725,2023 +1.8,2.1,"L-02",2023-06-17 15:27:32,20,3,0,202301,44,98,58.67303,-167.225655,2023 +2,2,"M-01",2023-06-18 07:21:23,20,3,0,202301,42,98,59.00352,-167.896795,2023 +2,2.2,"L-01",2023-06-18 09:59:45,20,3,0,202301,45,98,58.6668,-167.86672,2023 +0.6,4.8,"K-01",2023-06-18 12:35:35,41,3,0,202301,60,98,58.338835,-167.83584,2023 +0.4,4.1,"K-02",2023-06-18 15:37:34,20,3,0,202301,51,98,58.336965,-167.20862,2023 +1.2,5.4,"J-02",2023-06-19 07:24:49,31,3,0,202301,64,98,58.006285,-167.191,2023 +1.9,5.4,"J-01",2023-06-19 10:09:37,41,3,0,202301,67,98,58.000565,-167.808235,2023 +2.6,5.3,"I-01",2023-06-19 13:02:53,31,3,0,202301,69,98,57.66771,-167.777975,2023 +2.4,5.9,"I-02",2023-06-19 16:12:13,31,3,0,202301,67,98,57.654785,-167.15244,2023 +2.6,6.2,"H-02",2023-06-20 07:22:03,31,3,0,202301,71,98,57.337645,-167.117155,2023 +3.1,6.4,"H-01",2023-06-20 10:06:52,31,3,0,202301,74,98,57.326155,-167.74526,2023 +3.4,6.9,"G-01",2023-06-20 12:43:29,31,3,0,202301,77,98,56.99165,-167.698365,2023 +3.3,6.5,"G-02",2023-06-20 15:58:26,31,3,0,202301,73,98,56.99742,-167.09841,2023 +3.8,6.7,"F-01",2023-06-21 07:25:28,31,3,0,202301,102,98,56.671555,-167.68757,2023 +4.2,7.8,"F-18",2023-06-21 10:10:34,50,3,0,202301,107,98,56.666975,-168.279115,2023 +3.5,7.4,"G-18",2023-06-21 12:51:22,32,3,0,202301,81,98,57.007115,-168.33055,2023 +3.1,7.4,"H-18",2023-06-21 15:47:09,32,3,0,202301,73,98,57.33481,-168.36853,2023 +2.7,6.7,"I-18",2023-06-22 07:27:54,42,3,0,202301,71,98,57.670815,-168.39597,2023 +2,6.4,"JI1918",2023-06-22 09:56:40,42,3,0,202301,71,98,57.832345,-168.7359,2023 +2,6.3,"J-18",2023-06-22 12:21:06,42,3,0,202301,69,98,58.004325,-168.42941,2023 +1.4,5.8,"K-18",2023-06-22 15:05:12,41,3,0,202301,65,98,58.33246,-168.473125,2023 +0.9,5.1,"L-18",2023-06-23 12:31:25,20,3,0,202301,52,98,58.671705,-168.49781,2023 +2.3,3.1,"M-18",2023-06-23 14:59:32,20,3,0,202301,47,98,58.996185,-168.533685,2023 +2.3,2.6,"N-18",2023-06-24 07:16:52,20,3,0,202301,42,98,59.33388,-168.550715,2023 +2.7,2.8,"N-01",2023-06-24 10:08:17,20,3,0,202301,39,98,59.32745,-167.92618,2023 +3,3.1,"O-01",2023-06-24 12:41:40,20,3,0,202301,36,98,59.66695,-167.950575,2023 +4,4.2,"O-02",2023-06-24 15:29:52,20,3,0,202301,31,98,59.659695,-167.282185,2023 +3.9,4,"P-01",2023-06-25 12:21:16,20,3,0,202301,25,98,60.008025,-167.97231,2023 +2,2.9,"P-18",2023-06-25 14:53:54,20,3,0,202301,39,98,60.002745,-168.639425,2023 +4.6,4.7,"Q-02",2023-06-26 07:22:25,20,3,0,202301,31,98,60.33446,-167.272085,2023 +4.1,4.1,"Q-01",2023-06-26 09:46:11,20,3,0,202301,31,98,60.330975,-167.96873,2023 +1.9,2.2,"Q-18",2023-06-26 12:17:17,20,3,0,202301,37,98,60.337235,-168.67547,2023 +-1.1,4.2,"Q-19",2023-06-26 14:51:52,20,3,0,202301,43,98,60.33758,-169.31807,2023 +-0.2,4.1,"P-19",2023-06-26 17:34:15,20,3,0,202301,46,98,59.996915,-169.32667,2023 +-1,4.3,"P-20",2023-06-27 07:20:38,41,3,0,202301,54,98,60.002145,-169.97136,2023 +-0.1,2.2,"O-20",2023-06-27 09:58:07,41,3,0,202301,57,98,59.66427,-169.930445,2023 +0.2,4.6,"N-20",2023-06-27 12:44:05,41,3,0,202301,60,98,59.328185,-169.87745,2023 +0.3,5.9,"M-20",2023-06-27 15:32:52,41,3,0,202301,63,98,59.00466,-169.838025,2023 +0.6,6.3,"L-20",2023-06-28 07:25:33,41,3,0,202301,67,98,58.66068,-169.77708,2023 +0.9,6.6,"K-20",2023-06-28 09:56:10,41,3,0,202301,69,98,58.333705,-169.739715,2023 +1.2,6.5,"J-20",2023-06-28 12:36:20,42,3,0,202301,70,98,57.998895,-169.7099,2023 +1.9,6.8,"JI2019",2023-06-28 15:05:26,42,3,0,202301,66,98,57.834575,-169.368635,2023 +1.8,7,"I-20",2023-06-29 07:23:02,42,3,0,202301,71,98,57.65951,-169.65312,2023 +2.3,6.5,"IH2019",2023-06-29 10:15:58,42,3,0,202301,70,98,57.49803,-169.376485,2023 +1.7,6.5,"H-20",2023-06-29 14:33:57,42,3,0,202301,64,98,57.3367,-169.59332,2023 +2.6,7.2,"HG2019",2023-06-29 18:01:07,42,3,0,202301,72,98,57.17598,-169.33174,2023 +3.8,7.3,"GF2019",2023-06-30 07:18:56,32,3,0,202301,80,98,56.82716,-169.29922,2023 +4,6.1,"F-20",2023-06-30 09:33:28,32,3,0,202301,79,98,56.6622,-169.506665,2023 +4.2,7.9,"E-20",2023-06-30 12:03:16,50,3,0,202301,102,98,56.435425,-169.50108,2023 +4.2,7.6,"E-21",2023-06-30 14:18:19,50,3,0,202301,109,98,56.33947,-170.07922,2023 +4.2,8.1,"E-22",2023-06-30 17:35:49,61,3,0,202301,121,98,56.333495,-170.684155,2023 +4.1,7.9,"F-22",2023-07-01 07:26:27,61,3,0,202301,114,98,56.67343,-170.72847,2023 +4.1,7.1,"GF2221",2023-07-01 09:59:40,42,3,0,202301,100,98,56.842855,-170.48061,2023 +4.1,7,"F-21",2023-07-01 12:46:33,42,3,0,202301,97,98,56.667445,-170.13268,2023 +3.1,6.9,"GF2120",2023-07-01 15:24:05,42,3,0,202301,72,98,56.83843,-169.896235,2023 +4.5,5.2,"HG2221",2023-07-02 07:22:40,42,3,0,202301,50,98,57.11324,-170.46105,2023 +3.7,6.2,"G-21",2023-07-02 10:05:29,42,3,0,202301,70,98,56.99495,-170.17299,2023 +4.1,6.1,"HG2120",2023-07-02 12:20:57,42,3,0,202301,49,98,57.15801,-169.8932,2023 +3.1,8.2,"G-20",2023-07-02 14:48:57,42,3,0,202301,61,98,56.99128,-169.570205,2023 +4.1,8,"F-24",2023-07-08 07:47:49,61,3,6.22,202301,127,98,56.664525,-171.994625,2023 +4.1,8.4,"F-25",2023-07-08 12:09:38,61,3,0,202301,137,98,56.67167,-172.56786,2023 +3.6,8.4,"G-25",2023-07-08 15:09:48,61,3,0,202301,122,98,57.00176,-172.65728,2023 +4,8.3,"G-26",2023-07-09 07:51:03,61,3,0,202301,142,98,57.0096,-173.25863,2023 +3.3,8.4,"H-26",2023-07-09 10:34:10,61,3,0,202301,121,98,57.3256,-173.313555,2023 +3.2,8.5,"H-25",2023-07-09 13:10:40,61,3,0,202301,117,98,57.351295,-172.80523,2023 +3.4,8.6,"H-24",2023-07-09 16:23:44,61,3,0,202301,108,98,57.337855,-172.09994,2023 +3.3,8.8,"I-25",2023-07-10 07:44:23,61,3,3.12,202301,119,98,57.670565,-172.819245,2023 +3.9,8.7,"I-26",2023-07-10 11:10:05,61,3,0,202301,145,98,57.66949,-173.38772,2023 +3.3,8.6,"J-26",2023-07-10 13:53:04,61,3,0,202301,117,98,58.001515,-173.454465,2023 +3,8.9,"J-25",2023-07-10 16:29:57,61,3,0,202301,109,98,57.999055,-172.857835,2023 +2.9,8.8,"K-25",2023-07-11 07:47:48,61,3,0,202301,108,98,58.333565,-172.91555,2023 +2.8,9.1,"K-24",2023-07-11 10:36:13,61,3,0,202301,102,98,58.331745,-172.29598,2023 +2.3,8.6,"L-24",2023-07-11 13:14:55,61,3,0,202301,101,98,58.678615,-172.36947,2023 +2,8.1,"M-24",2023-07-11 15:54:04,41,3,0,202301,98,98,59.01068,-172.427765,2023 +-0.2,8.1,"S-22",2023-07-17 07:45:08,41,3,5,202301,60,98,60.98607,-171.50335,2023 +-1.2,7.9,"S-23",2023-07-17 10:18:14,41,3,5,202301,63,98,61.001325,-172.14154,2023 +-1.1,8.1,"S-24",2023-07-17 13:08:30,41,3,0,202301,66,98,61.002105,-172.82045,2023 +1.1,6.6,"R-24",2023-07-17 15:59:45,41,3,0,202301,44,98,60.67283,-172.76211,2023 +-1.2,8.8,"R-25",2023-07-18 10:35:19,41,3,0,202301,65,98,60.67037,-173.478895,2023 +-0.9,9.3,"Q-25",2023-07-18 13:23:42,43,3,2.3,202301,61,98,60.30686,-173.371115,2023 +-0.8,7.5,"QP2524",2023-07-18 15:36:29,43,3,0,202301,59,98,60.1757,-173.01935,2023 +-0.8,9.5,"P-25",2023-07-18 17:45:22,43,3,0,202301,74,98,60.008645,-173.287665,2023 +0.4,9.7,"P-26",2023-07-19 08:09:00,43,3,0,202301,96,98,60.010425,-173.943755,2023 +0,9.4,"QP2625",2023-07-19 10:27:01,43,3,0,202301,87,98,60.137005,-173.765745,2023 +-0.1,9.5,"Q-26",2023-07-19 15:00:19,43,3,0,202301,89,98,60.34264,-174.07871,2023 +0.5,9.7,"QP2726",2023-07-19 17:05:57,43,3,0,202301,99,98,60.17071,-174.35513,2023 +1.2,9.3,"PO2625",2023-07-20 07:43:21,43,3,0,202301,95,98,59.832305,-173.584785,2023 +0.9,9.7,"O-26",2023-07-20 10:19:38,62,3,0,202301,104,98,59.676625,-173.872185,2023 +1.1,9.7,"PO2726",2023-07-20 13:39:30,62,3,0,202301,104,98,59.85894,-174.26372,2023 +1.1,9.4,"P-27",2023-07-20 16:06:58,62,3,0,202301,107,98,59.99705,-174.59523,2023 +1.4,9.3,"O-27",2023-07-21 07:42:17,62,3,1.12,202301,115,98,59.66642,-174.459265,2023 +2,9.8,"N-27",2023-07-21 10:29:20,62,3,0,202301,120,98,59.320015,-174.43518,2023 +1.8,9.5,"N-26",2023-07-21 13:22:04,62,3,0,202301,110,98,59.3468,-173.804435,2023 +1.6,10.5,"ON2625",2023-07-21 15:49:29,43,3,1.11,202301,102,98,59.502175,-173.50622,2023 +2.6,9.8,"M-26",2023-07-22 07:43:51,61,3,0,202301,117,98,59.002595,-173.726025,2023 +2.4,9.7,"M-27",2023-07-22 10:30:05,61,3,0,202301,126,98,59.004485,-174.38614,2023 +2.4,9.5,"M-28",2023-07-22 13:11:13,61,3,0,202301,129,98,59.01067,-175.030265,2023 +2.1,10,"N-28",2023-07-22 15:58:42,61,3,0,202301,132,98,59.34403,-175.101695,2023 +2.1,9.5,"N-29",2023-07-23 07:43:28,61,3,0,202301,136,98,59.33743,-175.76101,2023 +2,9.8,"O-29",2023-07-23 10:33:00,61,3,0,202301,136,98,59.68665,-175.87847,2023 +1.8,10,"P-29",2023-07-23 13:08:21,61,3,0,202301,128,98,60.0046,-175.917315,2023 +1.7,9.7,"P-30",2023-07-23 16:14:16,61,3,0,202301,140,98,60.00591,-176.687895,2023 +2,9.3,"P-32",2023-07-24 07:47:25,61,3,0,202301,141,98,60.002965,-177.91547,2023 +1.8,9.7,"P-31",2023-07-24 10:50:00,61,3,0,202301,136,98,60.00095,-177.20138,2023 +1.8,9,"Q-31",2023-07-24 13:55:10,61,3,0,202301,147,98,60.34304,-177.38637,2023 +1.7,9.8,"Q-30",2023-07-24 16:49:58,61,3,0,202301,136,98,60.335525,-176.72817,2023 +2.7,9.1,"R-32",2023-07-25 07:45:19,61,3,0,202301,160,98,60.666715,-178.18552,2023 +1.5,10.3,"R-31",2023-07-25 10:35:11,61,3,0,202301,145,98,60.674615,-177.50002,2023 +1.4,10.3,"S-31",2023-07-25 13:17:58,90,3,0,202301,134,98,61.01193,-177.620935,2023 +1.2,9.6,"S-30",2023-07-25 16:06:01,90,3,0,202301,121,98,61.00312,-176.94303,2023 +1.6,9.9,"R-30",2023-07-26 07:52:49,61,3,0,202301,128,98,60.666555,-176.81864,2023 +0.6,9.6,"S-29",2023-07-26 11:18:54,90,3,0,202301,111,98,61.006015,-176.273425,2023 +0.2,10,"S-28",2023-07-26 14:38:26,90,3,0,202301,101,98,61.008085,-175.53123,2023 +-0.2,9.8,"S-27",2023-07-26 17:11:07,82,3,5,202301,91,98,61.00411,-174.859045,2023 +-1.4,10.1,"V-25",2023-07-31 09:24:34,82,3,0,202301,62,98,61.981035,-173.73251,2023 +-1.4,9.7,"U-25",2023-07-31 12:06:12,82,3,0,202301,69,98,61.65186,-173.668495,2023 +-1.6,10.5,"U-26",2023-07-31 15:09:50,82,3,0,202301,76,98,61.65736,-174.450725,2023 +-1,11,"T-26",2023-07-31 17:56:34,82,3,0,202301,79,98,61.33355,-174.3428,2023 +-0.4,10.1,"T-27",2023-08-01 08:20:49,82,3,0,202301,87,98,61.337885,-175.004705,2023 +0,10.2,"T-28",2023-08-01 10:52:44,90,3,0,202301,96,98,61.33503,-175.645655,2023 +0.3,10.7,"T-29",2023-08-01 13:29:18,90,3,0,202301,108,98,61.336435,-176.332635,2023 +0.5,10.3,"T-30",2023-08-01 16:08:44,90,3,0,202301,117,98,61.338885,-177.00921,2023 +0.5,9.8,"U-29",2023-08-02 08:09:16,90,3,0,202301,105,98,61.66602,-176.4631,2023 +0.1,10.2,"U-28",2023-08-02 11:36:46,82,3,0,202301,95,98,61.670335,-175.79393,2023 +-1.1,10.2,"U-27",2023-08-02 15:06:00,82,3,0,202301,85,98,61.67652,-175.10692,2023 +-1.6,10.2,"V-26",2023-08-02 19:18:08,82,3,0,202301,74,98,61.99781,-174.50925,2023 +-1.6,9.7,"V-27",2023-08-03 08:16:52,82,3,0,202301,81,98,62.00902,-175.202335,2023 +-1.3,9.7,"V-28",2023-08-03 10:46:16,82,3,0,202301,91,98,62.00608,-175.839895,2023 7.3,8.2,"G-15",2019-06-03 07:04:12,10,3,0,201901,35,98,57.00388,-159.13627,2019 6,8.2,"H-15",2019-06-03 11:36:45,10,3,0,201901,49,98,57.346585,-159.059015,2019 6.2,6.8,"I-15",2019-06-03 15:19:45,10,3,0,201901,45,98,57.63733,-159.028095,2019 @@ -14688,198 +15074,179 @@ 0.3,10.6,"U-26",2019-07-28 10:15:09,82,3,0,201901,77,98,61.670065,-174.42728,2019 -0.3,10.6,"V-26",2019-07-28 13:09:00,82,3,0,201901,74,98,62.00527,-174.499435,2019 1,10.4,"V-25",2019-07-28 16:23:52,82,3,0,201901,64,98,61.985535,-173.746405,2019 -4,4.2,"E-12",2023-05-28 15:56:41,10,3,0,202301,54,98,56.33815,-161.01849,2023 -3.7,3.7,"F-13",2023-05-29 10:48:20,31,3,0,202301,59,98,56.66523,-160.36954,2023 -4.6,4.7,"F-14",2023-05-29 14:17:28,10,3,0,202301,37,98,56.678295,-159.75818,2023 -3.7,3.8,"G-14",2023-05-29 17:51:52,10,3,0,202301,54,98,56.99096,-159.67598,2023 -3.6,3.9,"H-14",2023-05-30 07:29:17,10,3,0,202301,56,98,57.34045,-159.650505,2023 -3.5,3.5,"I-14",2023-05-30 10:10:42,10,3,0,202301,50,98,57.65895,-159.62963,2023 -3,4.2,"J-14",2023-05-30 13:05:06,10,3,0,202301,42,98,58.0015,-159.612765,2023 -3.1,3.9,"K-14",2023-05-30 15:42:23,10,3,0,202301,25,98,58.312185,-159.569145,2023 -3.4,3.8,"K-12",2023-05-31 09:46:56,10,3,1.1,202301,32,98,58.28491,-160.80851,2023 -2.6,3.2,"J-12",2023-05-31 11:56:03,10,3,0,202301,45,98,58.011675,-160.873295,2023 -3,3.5,"I-12",2023-05-31 15:10:17,31,3,0,202301,56,98,57.673075,-160.895435,2023 -3,3.6,"H-12",2023-06-01 07:29:22,31,3,0,202301,62,98,57.337925,-160.938915,2023 -3.1,3.2,"H-11",2023-06-01 10:24:16,31,3,0,202301,56,98,57.330895,-161.53269,2023 -3.3,3.4,"G-11",2023-06-01 13:04:01,31,3,0,202301,68,98,57.002485,-161.56328,2023 -3,3.2,"G-10",2023-06-01 15:42:43,31,3,0,202301,60,98,57.00094,-162.165025,2023 -3.1,3.6,"I-11",2023-06-02 07:26:34,10,3,0,202301,53,98,57.666255,-161.502455,2023 -2.7,3.3,"J-11",2023-06-02 09:58:03,10,3,0,202301,54,98,57.992995,-161.48269,2023 -3,3.8,"K-11",2023-06-02 12:21:35,10,3,0,202301,41,98,58.228505,-161.54849,2023 -2.7,3.5,"K-10",2023-06-02 14:46:53,10,3,0,202301,47,98,58.320535,-162.05581,2023 -2.9,2.8,"J-10",2023-06-03 07:27:27,10,3,0,202301,40,98,58.009425,-162.13323,2023 -2.5,2.5,"J-09",2023-06-03 10:17:46,10,3,0,202301,42,98,57.995265,-162.75119,2023 -2.7,2.8,"K-09",2023-06-04 11:52:56,10,3,0,202301,33,98,58.329165,-162.71882,2023 -2.9,3,"L-09",2023-06-04 14:26:55,10,3,0,202301,27,98,58.63519,-162.707725,2023 -3.8,3.7,"M-08",2023-06-05 07:21:36,10,3,0,202301,20,98,58.99032,-163.37137,2023 -3,2.9,"M-07",2023-06-05 09:51:44,10,3,0,202301,29,98,59.006115,-164.014705,2023 -4.8,4.9,"N-07",2023-06-05 12:21:25,10,3,0,202301,23,98,59.33511,-164.010375,2023 -3.5,3.5,"N-06",2023-06-05 14:54:41,10,3,0,202301,23,98,59.33083,-164.66042,2023 -2.9,2.8,"M-06",2023-06-06 07:21:13,10,3,0,202301,27,98,58.998605,-164.62915,2023 -1.8,1.7,"L-06",2023-06-06 10:38:38,10,3,0,202301,38,98,58.683395,-164.65786,2023 -1.6,2,"K-06",2023-06-06 13:47:16,10,3,0,202301,44,98,58.33459,-164.64496,2023 -1.9,2.4,"K-07",2023-06-06 16:55:13,10,3,0,202301,44,98,58.32943,-164.058645,2023 -1.5,2.2,"J-07",2023-06-07 07:23:17,10,3,0,202301,46,98,58.00824,-164.02516,2023 -1,2.8,"I-07",2023-06-07 10:09:16,10,3,0,202301,49,98,57.670775,-164.00704,2023 -1.6,4.5,"H-07",2023-06-07 13:01:45,31,3,0,202301,62,98,57.32386,-164.00821,2023 -2.8,5.3,"G-07",2023-06-07 15:33:27,31,3,0,202301,67,98,57.00155,-164.03446,2023 -1.7,4.2,"H-08",2023-06-08 07:24:07,10,3,0,202301,53,98,57.33672,-163.39175,2023 -2.7,5.1,"G-08",2023-06-08 10:05:05,31,3,0,202301,66,98,56.99656,-163.398165,2023 -3.3,5.9,"F-08",2023-06-08 12:42:58,31,3,0,202301,75,98,56.66744,-163.395155,2023 -3.1,6.5,"E-08",2023-06-08 15:23:29,31,3,1.1,202301,84,98,56.32736,-163.41756,2023 -3.3,6.6,"D-08",2023-06-09 07:21:39,31,3,0,202301,88,98,55.995625,-163.390825,2023 -3.7,6.3,"C-08",2023-06-09 09:57:19,31,3,0,202301,82,98,55.67166,-163.400095,2023 -4.5,6.3,"B-08",2023-06-09 12:40:41,31,3,0,202301,54,98,55.337865,-163.42151,2023 -5.4,5.6,"Z-05",2023-06-12 07:26:00,31,3,3,202301,81,98,54.672745,-165.13774,2023 -4.3,5.9,"AZ0504",2023-06-12 14:50:27,50,3,0,202301,155,98,54.832875,-165.517775,2023 -4.4,6.5,"B-04",2023-06-12 18:51:08,50,3,0,202301,120,98,55.338335,-165.78311,2023 -4.3,6.9,"C-04",2023-06-13 07:27:19,50,3,0,202301,118,98,55.671155,-165.804025,2023 -4.3,6.3,"D-04",2023-06-13 10:12:51,31,3,0,202301,107,98,56.008555,-165.78839,2023 -4.2,6.3,"D-05",2023-06-13 13:14:42,31,3,0,202301,96,98,56.006425,-165.17988,2023 -3.5,6.4,"E-05",2023-06-13 15:53:36,31,3,0,202301,87,98,56.344285,-165.19915,2023 -3.2,6.2,"F-05",2023-06-14 07:23:43,31,3,4.1,202301,76,98,56.670125,-165.20474,2023 -2.6,5.6,"G-05",2023-06-14 10:13:32,31,3,0,202301,70,98,56.99937,-165.222725,2023 -2.2,5.6,"H-05",2023-06-14 12:51:52,31,3,0,202301,66,98,57.3273,-165.23679,2023 -0.6,4.9,"I-05",2023-06-14 15:29:36,31,3,0,202301,60,98,57.67649,-165.25134,2023 -0.5,4.3,"J-05",2023-06-15 07:48:35,10,3,0,202301,51,98,58.001315,-165.246835,2023 -2.2,2.3,"K-05",2023-06-15 10:26:08,10,3,0,202301,45,98,58.335605,-165.292095,2023 -2.3,2.4,"L-05",2023-06-15 13:17:38,10,3,0,202301,40,98,58.65731,-165.30858,2023 -3.2,3.4,"M-05",2023-06-15 15:57:58,10,3,0,202301,27,98,59.00384,-165.30189,2023 -4.3,4.3,"N-05",2023-06-16 07:16:44,20,3,0,202301,21,98,59.337195,-165.296845,2023 -3.7,3.6,"N-04",2023-06-16 10:17:15,20,3,0,202301,25,98,59.33154,-165.948895,2023 -4.6,4.8,"O-04",2023-06-16 13:09:24,20,3,0,202301,26,98,59.611345,-165.925455,2023 -3,3,"O-03",2023-06-16 15:52:30,20,3,0,202301,27,98,59.666035,-166.614235,2023 -3.8,3.8,"N-03",2023-06-17 07:21:54,20,3,0,202301,28,98,59.346275,-166.58836,2023 -2.8,2.8,"N-02",2023-06-17 10:15:35,20,3,0,202301,32,98,59.345245,-167.24722,2023 -2.2,2.2,"M-02",2023-06-17 12:52:37,20,3,0,202301,40,98,59.00401,-167.243725,2023 -1.8,2.1,"L-02",2023-06-17 15:27:32,20,3,0,202301,44,98,58.67303,-167.225655,2023 -2,2,"M-01",2023-06-18 07:21:23,20,3,0,202301,42,98,59.00352,-167.896795,2023 -2,2.2,"L-01",2023-06-18 09:59:45,20,3,0,202301,45,98,58.6668,-167.86672,2023 -0.6,4.8,"K-01",2023-06-18 12:35:35,41,3,0,202301,60,98,58.338835,-167.83584,2023 -0.4,4.1,"K-02",2023-06-18 15:37:34,20,3,0,202301,51,98,58.336965,-167.20862,2023 -1.2,5.4,"J-02",2023-06-19 07:24:49,31,3,0,202301,64,98,58.006285,-167.191,2023 -1.9,5.4,"J-01",2023-06-19 10:09:37,41,3,0,202301,67,98,58.000565,-167.808235,2023 -2.6,5.3,"I-01",2023-06-19 13:02:53,31,3,0,202301,69,98,57.66771,-167.777975,2023 -2.4,5.9,"I-02",2023-06-19 16:12:13,31,3,0,202301,67,98,57.654785,-167.15244,2023 -2.6,6.2,"H-02",2023-06-20 07:22:03,31,3,0,202301,71,98,57.337645,-167.117155,2023 -3.1,6.4,"H-01",2023-06-20 10:06:52,31,3,0,202301,74,98,57.326155,-167.74526,2023 -3.4,6.9,"G-01",2023-06-20 12:43:29,31,3,0,202301,77,98,56.99165,-167.698365,2023 -3.3,6.5,"G-02",2023-06-20 15:58:26,31,3,0,202301,73,98,56.99742,-167.09841,2023 -3.8,6.7,"F-01",2023-06-21 07:25:28,31,3,0,202301,102,98,56.671555,-167.68757,2023 -4.2,7.8,"F-18",2023-06-21 10:10:34,50,3,0,202301,107,98,56.666975,-168.279115,2023 -3.5,7.4,"G-18",2023-06-21 12:51:22,32,3,0,202301,81,98,57.007115,-168.33055,2023 -3.1,7.4,"H-18",2023-06-21 15:47:09,32,3,0,202301,73,98,57.33481,-168.36853,2023 -2.7,6.7,"I-18",2023-06-22 07:27:54,42,3,0,202301,71,98,57.670815,-168.39597,2023 -2,6.4,"JI1918",2023-06-22 09:56:40,42,3,0,202301,71,98,57.832345,-168.7359,2023 -2,6.3,"J-18",2023-06-22 12:21:06,42,3,0,202301,69,98,58.004325,-168.42941,2023 -1.4,5.8,"K-18",2023-06-22 15:05:12,41,3,0,202301,65,98,58.33246,-168.473125,2023 -0.9,5.1,"L-18",2023-06-23 12:31:25,20,3,0,202301,52,98,58.671705,-168.49781,2023 -2.3,3.1,"M-18",2023-06-23 14:59:32,20,3,0,202301,47,98,58.996185,-168.533685,2023 -2.3,2.6,"N-18",2023-06-24 07:16:52,20,3,0,202301,42,98,59.33388,-168.550715,2023 -2.7,2.8,"N-01",2023-06-24 10:08:17,20,3,0,202301,39,98,59.32745,-167.92618,2023 -3,3.1,"O-01",2023-06-24 12:41:40,20,3,0,202301,36,98,59.66695,-167.950575,2023 -4,4.2,"O-02",2023-06-24 15:29:52,20,3,0,202301,31,98,59.659695,-167.282185,2023 -3.9,4,"P-01",2023-06-25 12:21:16,20,3,0,202301,25,98,60.008025,-167.97231,2023 -2,2.9,"P-18",2023-06-25 14:53:54,20,3,0,202301,39,98,60.002745,-168.639425,2023 -4.6,4.7,"Q-02",2023-06-26 07:22:25,20,3,0,202301,31,98,60.33446,-167.272085,2023 -4.1,4.1,"Q-01",2023-06-26 09:46:11,20,3,0,202301,31,98,60.330975,-167.96873,2023 -1.9,2.2,"Q-18",2023-06-26 12:17:17,20,3,0,202301,37,98,60.337235,-168.67547,2023 --1.1,4.2,"Q-19",2023-06-26 14:51:52,20,3,0,202301,43,98,60.33758,-169.31807,2023 --0.2,4.1,"P-19",2023-06-26 17:34:15,20,3,0,202301,46,98,59.996915,-169.32667,2023 --1,4.3,"P-20",2023-06-27 07:20:38,41,3,0,202301,54,98,60.002145,-169.97136,2023 --0.1,2.2,"O-20",2023-06-27 09:58:07,41,3,0,202301,57,98,59.66427,-169.930445,2023 -0.2,4.6,"N-20",2023-06-27 12:44:05,41,3,0,202301,60,98,59.328185,-169.87745,2023 -0.3,5.9,"M-20",2023-06-27 15:32:52,41,3,0,202301,63,98,59.00466,-169.838025,2023 -0.6,6.3,"L-20",2023-06-28 07:25:33,41,3,0,202301,67,98,58.66068,-169.77708,2023 -0.9,6.6,"K-20",2023-06-28 09:56:10,41,3,0,202301,69,98,58.333705,-169.739715,2023 -1.2,6.5,"J-20",2023-06-28 12:36:20,42,3,0,202301,70,98,57.998895,-169.7099,2023 -1.9,6.8,"JI2019",2023-06-28 15:05:26,42,3,0,202301,66,98,57.834575,-169.368635,2023 -1.8,7,"I-20",2023-06-29 07:23:02,42,3,0,202301,71,98,57.65951,-169.65312,2023 -2.3,6.5,"IH2019",2023-06-29 10:15:58,42,3,0,202301,70,98,57.49803,-169.376485,2023 -1.7,6.5,"H-20",2023-06-29 14:33:57,42,3,0,202301,64,98,57.3367,-169.59332,2023 -2.6,7.2,"HG2019",2023-06-29 18:01:07,42,3,0,202301,72,98,57.17598,-169.33174,2023 -3.8,7.3,"GF2019",2023-06-30 07:18:56,32,3,0,202301,80,98,56.82716,-169.29922,2023 -4,6.1,"F-20",2023-06-30 09:33:28,32,3,0,202301,79,98,56.6622,-169.506665,2023 -4.2,7.9,"E-20",2023-06-30 12:03:16,50,3,0,202301,102,98,56.435425,-169.50108,2023 -4.2,7.6,"E-21",2023-06-30 14:18:19,50,3,0,202301,109,98,56.33947,-170.07922,2023 -4.2,8.1,"E-22",2023-06-30 17:35:49,61,3,0,202301,121,98,56.333495,-170.684155,2023 -4.1,7.9,"F-22",2023-07-01 07:26:27,61,3,0,202301,114,98,56.67343,-170.72847,2023 -4.1,7.1,"GF2221",2023-07-01 09:59:40,42,3,0,202301,100,98,56.842855,-170.48061,2023 -4.1,7,"F-21",2023-07-01 12:46:33,42,3,0,202301,97,98,56.667445,-170.13268,2023 -3.1,6.9,"GF2120",2023-07-01 15:24:05,42,3,0,202301,72,98,56.83843,-169.896235,2023 -4.5,5.2,"HG2221",2023-07-02 07:22:40,42,3,0,202301,50,98,57.11324,-170.46105,2023 -3.7,6.2,"G-21",2023-07-02 10:05:29,42,3,0,202301,70,98,56.99495,-170.17299,2023 -4.1,6.1,"HG2120",2023-07-02 12:20:57,42,3,0,202301,49,98,57.15801,-169.8932,2023 -3.1,8.2,"G-20",2023-07-02 14:48:57,42,3,0,202301,61,98,56.99128,-169.570205,2023 -4.1,8,"F-24",2023-07-08 07:47:49,61,3,6.22,202301,127,98,56.664525,-171.994625,2023 -4.1,8.4,"F-25",2023-07-08 12:09:38,61,3,0,202301,137,98,56.67167,-172.56786,2023 -3.6,8.4,"G-25",2023-07-08 15:09:48,61,3,0,202301,122,98,57.00176,-172.65728,2023 -4,8.3,"G-26",2023-07-09 07:51:03,61,3,0,202301,142,98,57.0096,-173.25863,2023 -3.3,8.4,"H-26",2023-07-09 10:34:10,61,3,0,202301,121,98,57.3256,-173.313555,2023 -3.2,8.5,"H-25",2023-07-09 13:10:40,61,3,0,202301,117,98,57.351295,-172.80523,2023 -3.4,8.6,"H-24",2023-07-09 16:23:44,61,3,0,202301,108,98,57.337855,-172.09994,2023 -3.3,8.8,"I-25",2023-07-10 07:44:23,61,3,3.12,202301,119,98,57.670565,-172.819245,2023 -3.9,8.7,"I-26",2023-07-10 11:10:05,61,3,0,202301,145,98,57.66949,-173.38772,2023 -3.3,8.6,"J-26",2023-07-10 13:53:04,61,3,0,202301,117,98,58.001515,-173.454465,2023 -3,8.9,"J-25",2023-07-10 16:29:57,61,3,0,202301,109,98,57.999055,-172.857835,2023 -2.9,8.8,"K-25",2023-07-11 07:47:48,61,3,0,202301,108,98,58.333565,-172.91555,2023 -2.8,9.1,"K-24",2023-07-11 10:36:13,61,3,0,202301,102,98,58.331745,-172.29598,2023 -2.3,8.6,"L-24",2023-07-11 13:14:55,61,3,0,202301,101,98,58.678615,-172.36947,2023 -2,8.1,"M-24",2023-07-11 15:54:04,41,3,0,202301,98,98,59.01068,-172.427765,2023 --0.2,8.1,"S-22",2023-07-17 07:45:08,41,3,5,202301,60,98,60.98607,-171.50335,2023 --1.2,7.9,"S-23",2023-07-17 10:18:14,41,3,5,202301,63,98,61.001325,-172.14154,2023 --1.1,8.1,"S-24",2023-07-17 13:08:30,41,3,0,202301,66,98,61.002105,-172.82045,2023 -1.1,6.6,"R-24",2023-07-17 15:59:45,41,3,0,202301,44,98,60.67283,-172.76211,2023 --1.2,8.8,"R-25",2023-07-18 10:35:19,41,3,0,202301,65,98,60.67037,-173.478895,2023 --0.9,9.3,"Q-25",2023-07-18 13:23:42,43,3,2.3,202301,61,98,60.30686,-173.371115,2023 --0.8,7.5,"QP2524",2023-07-18 15:36:29,43,3,0,202301,59,98,60.1757,-173.01935,2023 --0.8,9.5,"P-25",2023-07-18 17:45:22,43,3,0,202301,74,98,60.008645,-173.287665,2023 -0.4,9.7,"P-26",2023-07-19 08:09:00,43,3,0,202301,96,98,60.010425,-173.943755,2023 -0,9.4,"QP2625",2023-07-19 10:27:01,43,3,0,202301,87,98,60.137005,-173.765745,2023 --0.1,9.5,"Q-26",2023-07-19 15:00:19,43,3,0,202301,89,98,60.34264,-174.07871,2023 -0.5,9.7,"QP2726",2023-07-19 17:05:57,43,3,0,202301,99,98,60.17071,-174.35513,2023 -1.2,9.3,"PO2625",2023-07-20 07:43:21,43,3,0,202301,95,98,59.832305,-173.584785,2023 -0.9,9.7,"O-26",2023-07-20 10:19:38,62,3,0,202301,104,98,59.676625,-173.872185,2023 -1.1,9.7,"PO2726",2023-07-20 13:39:30,62,3,0,202301,104,98,59.85894,-174.26372,2023 -1.1,9.4,"P-27",2023-07-20 16:06:58,62,3,0,202301,107,98,59.99705,-174.59523,2023 -1.4,9.3,"O-27",2023-07-21 07:42:17,62,3,1.12,202301,115,98,59.66642,-174.459265,2023 -2,9.8,"N-27",2023-07-21 10:29:20,62,3,0,202301,120,98,59.320015,-174.43518,2023 -1.8,9.5,"N-26",2023-07-21 13:22:04,62,3,0,202301,110,98,59.3468,-173.804435,2023 -1.6,10.5,"ON2625",2023-07-21 15:49:29,43,3,1.11,202301,102,98,59.502175,-173.50622,2023 -2.6,9.8,"M-26",2023-07-22 07:43:51,61,3,0,202301,117,98,59.002595,-173.726025,2023 -2.4,9.7,"M-27",2023-07-22 10:30:05,61,3,0,202301,126,98,59.004485,-174.38614,2023 -2.4,9.5,"M-28",2023-07-22 13:11:13,61,3,0,202301,129,98,59.01067,-175.030265,2023 -2.1,10,"N-28",2023-07-22 15:58:42,61,3,0,202301,132,98,59.34403,-175.101695,2023 -2.1,9.5,"N-29",2023-07-23 07:43:28,61,3,0,202301,136,98,59.33743,-175.76101,2023 -2,9.8,"O-29",2023-07-23 10:33:00,61,3,0,202301,136,98,59.68665,-175.87847,2023 -1.8,10,"P-29",2023-07-23 13:08:21,61,3,0,202301,128,98,60.0046,-175.917315,2023 -1.7,9.7,"P-30",2023-07-23 16:14:16,61,3,0,202301,140,98,60.00591,-176.687895,2023 -2,9.3,"P-32",2023-07-24 07:47:25,61,3,0,202301,141,98,60.002965,-177.91547,2023 -1.8,9.7,"P-31",2023-07-24 10:50:00,61,3,0,202301,136,98,60.00095,-177.20138,2023 -1.8,9,"Q-31",2023-07-24 13:55:10,61,3,0,202301,147,98,60.34304,-177.38637,2023 -1.7,9.8,"Q-30",2023-07-24 16:49:58,61,3,0,202301,136,98,60.335525,-176.72817,2023 -2.7,9.1,"R-32",2023-07-25 07:45:19,61,3,0,202301,160,98,60.666715,-178.18552,2023 -1.5,10.3,"R-31",2023-07-25 10:35:11,61,3,0,202301,145,98,60.674615,-177.50002,2023 -1.4,10.3,"S-31",2023-07-25 13:17:58,90,3,0,202301,134,98,61.01193,-177.620935,2023 -1.2,9.6,"S-30",2023-07-25 16:06:01,90,3,0,202301,121,98,61.00312,-176.94303,2023 -1.6,9.9,"R-30",2023-07-26 07:52:49,61,3,0,202301,128,98,60.666555,-176.81864,2023 -0.6,9.6,"S-29",2023-07-26 11:18:54,90,3,0,202301,111,98,61.006015,-176.273425,2023 -0.2,10,"S-28",2023-07-26 14:38:26,90,3,0,202301,101,98,61.008085,-175.53123,2023 --0.2,9.8,"S-27",2023-07-26 17:11:07,82,3,5,202301,91,98,61.00411,-174.859045,2023 --1.4,10.1,"V-25",2023-07-31 09:24:34,82,3,0,202301,62,98,61.981035,-173.73251,2023 --1.4,9.7,"U-25",2023-07-31 12:06:12,82,3,0,202301,69,98,61.65186,-173.668495,2023 --1.6,10.5,"U-26",2023-07-31 15:09:50,82,3,0,202301,76,98,61.65736,-174.450725,2023 --1,11,"T-26",2023-07-31 17:56:34,82,3,0,202301,79,98,61.33355,-174.3428,2023 --0.4,10.1,"T-27",2023-08-01 08:20:49,82,3,0,202301,87,98,61.337885,-175.004705,2023 -0,10.2,"T-28",2023-08-01 10:52:44,90,3,0,202301,96,98,61.33503,-175.645655,2023 -0.3,10.7,"T-29",2023-08-01 13:29:18,90,3,0,202301,108,98,61.336435,-176.332635,2023 -0.5,10.3,"T-30",2023-08-01 16:08:44,90,3,0,202301,117,98,61.338885,-177.00921,2023 -0.5,9.8,"U-29",2023-08-02 08:09:16,90,3,0,202301,105,98,61.66602,-176.4631,2023 -0.1,10.2,"U-28",2023-08-02 11:36:46,82,3,0,202301,95,98,61.670335,-175.79393,2023 --1.1,10.2,"U-27",2023-08-02 15:06:00,82,3,0,202301,85,98,61.67652,-175.10692,2023 --1.6,10.2,"V-26",2023-08-02 19:18:08,82,3,0,202301,74,98,61.99781,-174.50925,2023 --1.6,9.7,"V-27",2023-08-03 08:16:52,82,3,0,202301,81,98,62.00902,-175.202335,2023 --1.3,9.7,"V-28",2023-08-03 10:46:16,82,3,0,202301,91,98,62.00608,-175.839895,2023 +3.6,3.6,"H-15",2024-06-02 07:19:22,10,3,0,202401,49,98,57.33521,-159.05093,2024 +2.9,2.9,"I-15",2024-06-02 10:31:06,10,3,0,202401,48,98,57.6738,-159.02217,2024 +2.8,2.9,"J-15",2024-06-02 13:18:46,10,3,0,202401,40,98,57.9781,-158.99151,2024 +3.7,5.3,"K-14",2024-06-02 17:03:55,10,3,0,202401,23,98,58.34026,-159.542335,2024 +2,2.1,"J-14",2024-06-03 07:18:28,10,3,0,202401,43,98,58.000465,-159.574975,2024 +2.8,3.6,"H-14",2024-06-03 12:59:40,10,3,0,202401,55,98,57.326955,-159.687635,2024 +3.7,4.7,"E-12",2024-06-04 07:12:16,10,3,0,202401,55,98,56.348355,-161.00501,2024 +3.1,3.7,"F-12",2024-06-04 14:31:45,31,3,0,202401,68,98,56.668665,-160.97944,2024 +3,3,"G-12",2024-06-05 07:18:05,31,3,0,202401,67,98,56.99437,-160.94989,2024 +2.7,2.8,"H-12",2024-06-05 10:22:45,31,3,0,202401,66,98,57.33555,-160.899965,2024 +2.6,2.8,"I-12",2024-06-05 14:38:12,31,3,0,202401,56,98,57.66746,-160.88276,2024 +2.1,2.5,"J-12",2024-06-05 17:32:03,10,3,0,202401,44,98,58.000315,-160.843555,2024 +2.1,2.7,"J-13",2024-06-06 07:10:52,10,3,0,202401,52,98,58.002705,-160.22353,2024 +2.4,3.7,"K-13",2024-06-06 09:58:50,10,3,2.4,202401,37,98,58.268655,-160.002075,2024 +3.6,4.3,"K-12",2024-06-06 13:16:09,10,3,0,202401,31,98,58.28574,-160.80615,2024 +2.8,3.3,"K-11",2024-06-06 16:23:27,10,3,0,202401,40,98,58.21639,-161.54697,2024 +3.6,3.6,"K-10",2024-06-07 07:09:05,10,3,0,202401,49,98,58.32506,-162.08567,2024 +2.3,2.2,"J-10",2024-06-07 10:13:32,10,3,0,202401,39,98,58.000285,-162.12108,2024 +2.1,2.1,"J-11",2024-06-07 13:20:44,10,3,0,202401,55,98,57.98732,-161.47314,2024 +2.1,2.2,"I-11",2024-06-07 16:11:41,10,3,0,202401,52,98,57.6706,-161.498995,2024 +3.2,3.2,"G-10",2024-06-08 07:12:16,31,3,2.4,202401,61,98,56.991315,-162.169275,2024 +3.3,3.5,"F-10",2024-06-08 12:41:07,31,3,0,202401,71,98,56.66961,-162.169375,2024 +3.5,3.6,"E-10",2024-06-08 15:25:01,31,3,3.13,202401,78,98,56.33036,-162.200475,2024 +3.3,3.3,"G-09",2024-06-09 07:16:40,31,3,0,202401,61,98,56.996945,-162.7908,2024 +2.7,2.9,"I-09",2024-06-10 13:09:11,10,3,0,202401,44,98,57.669715,-162.744165,2024 +2.4,3,"J-09",2024-06-10 15:57:46,10,3,0,202401,42,98,58.00088,-162.72135,2024 +3,3,"K-09",2024-06-11 07:09:33,10,3,0,202401,32,98,58.325825,-162.70471,2024 +3.3,3.3,"L-09",2024-06-11 09:41:42,10,3,0,202401,27,98,58.64318,-162.723705,2024 +3.2,3.2,"L-08",2024-06-11 12:24:51,10,3,0,202401,33,98,58.679425,-163.345805,2024 +4.6,4.8,"M-08",2024-06-11 14:54:55,10,3,0,202401,24,98,58.992885,-163.369365,2024 +4.9,6.8,"N-07",2024-06-12 06:54:56,10,3,0,202401,21,98,59.32704,-164.00025,2024 +3.3,4.1,"M-07",2024-06-12 09:26:31,10,3,0,202401,28,98,59.003495,-164.003685,2024 +3.1,3.1,"L-07",2024-06-12 12:14:49,10,3,0,202401,35,98,58.67605,-164.004875,2024 +2.6,2.8,"K-07",2024-06-12 15:18:19,10,3,0,202401,43,98,58.32074,-163.95177,2024 +2.6,2.9,"K-08",2024-06-12 17:47:54,10,3,0,202401,37,98,58.32404,-163.381355,2024 +2.6,2.8,"J-08",2024-06-13 07:13:19,10,3,0,202401,42,98,57.999925,-163.351225,2024 +2.7,3.1,"J-07",2024-06-13 10:03:26,10,3,0,202401,47,98,57.992205,-164.01121,2024 +3.4,4.1,"I-07",2024-06-13 12:58:23,10,3,0,202401,51,98,57.66923,-164.01268,2024 +2.9,3.8,"I-06",2024-06-13 15:41:52,10,3,0,202401,54,98,57.658835,-164.62789,2024 +2.8,4.2,"H-06",2024-06-14 07:11:42,31,3,0,202401,65,98,57.34003,-164.62111,2024 +3.2,4.4,"G-06",2024-06-14 10:09:22,31,3,0,202401,69,98,56.98833,-164.61554,2024 +3.3,4.6,"F-06",2024-06-14 12:54:19,31,3,0,202401,75,98,56.66616,-164.60419,2024 +3.5,5.8,"E-06",2024-06-14 15:48:45,31,3,0,202401,87,98,56.333375,-164.58716,2024 +3.8,6.1,"D-06",2024-06-15 07:10:39,31,3,0,202401,93,98,55.99759,-164.59125,2024 +4,6.2,"C-06",2024-06-15 10:01:08,31,3,0,202401,96,98,55.672025,-164.59845,2024 +5.4,5.6,"Z-05",2024-06-18 07:10:32,31,3,0,202401,84,98,54.6836,-165.15957,2024 +3.8,5.8,"AZ0504",2024-06-18 10:56:04,50,3,0,202401,159,98,54.82531,-165.5175,2024 +4.3,6.8,"A-05",2024-06-18 14:03:41,50,3,0,202401,111,98,54.99662,-165.156085,2024 +3.9,7.4,"B-04",2024-06-18 17:45:34,50,3,0,202401,122,98,55.32571,-165.782545,2024 +4,7.7,"C-04",2024-06-19 08:04:32,50,3,0,202401,118,98,55.639075,-165.78841,2024 +3.9,8.3,"D-04",2024-06-19 11:04:07,31,3,0,202401,107,98,55.99856,-165.78202,2024 +3.8,8.1,"E-04",2024-06-19 13:46:41,31,3,0,202401,92,98,56.32654,-165.810715,2024 +2.9,7.5,"F-04",2024-06-19 16:24:28,31,3,0,202401,79,98,56.6562,-165.83246,2024 +3.2,8.3,"G-04",2024-06-20 07:09:25,31,3,0,202401,73,98,56.97778,-165.844305,2024 +3,7.4,"H-04",2024-06-20 10:00:56,31,3,0,202401,69,98,57.32418,-165.85189,2024 +2.7,6.9,"I-04",2024-06-20 12:55:56,31,3,0,202401,64,98,57.67546,-165.860355,2024 +2.2,6.4,"J-04",2024-06-20 15:48:21,10,3,0,202401,55,98,58.00762,-165.888795,2024 +2.3,5.4,"K-04",2024-06-21 07:06:55,10,3,0,202401,44,98,58.33986,-165.89499,2024 +2.7,5.3,"L-04",2024-06-21 09:49:19,10,3,0,202401,38,98,58.67455,-165.90797,2024 +3.8,3.9,"M-04",2024-06-21 12:45:14,20,3,0,202401,31,98,58.99941,-165.95284,2024 +4.3,4.5,"M-05",2024-06-21 16:01:32,10,3,0,202401,28,98,59.002555,-165.29917,2024 +5.6,5.8,"O-04",2024-06-22 07:08:28,20,3,0,202401,27,98,59.628115,-165.92081,2024 +4.9,5,"O-03",2024-06-22 10:07:56,20,3,0,202401,28,98,59.66574,-166.6228,2024 +3.4,3.5,"O-02",2024-06-22 12:50:20,20,3,0,202401,32,98,59.65289,-167.26951,2024 +3.6,3.8,"N-02",2024-06-22 15:30:53,20,3,0,202401,31,98,59.34348,-167.24194,2024 +2.4,5.1,"M-02",2024-06-23 07:08:57,20,3,0,202401,40,98,58.99033,-167.238965,2024 +2.1,5.7,"L-02",2024-06-23 09:43:42,20,3,0,202401,44,98,58.682905,-167.230235,2024 +1.6,5.6,"K-02",2024-06-23 12:42:19,20,3,0,202401,52,98,58.32416,-167.191935,2024 +2,6.6,"J-02",2024-06-23 15:42:05,31,3,0,202401,63,98,57.991395,-167.139245,2024 +3.4,8.4,"F-02",2024-06-24 07:08:31,31,3,0,202401,96,98,56.67118,-167.060095,2024 +4,8.5,"E-02",2024-06-24 09:56:37,50,3,0,202401,113,98,56.33654,-167.01848,2024 +4.2,8.3,"D-02",2024-06-24 12:39:08,50,3,0,202401,134,98,56.002575,-166.996845,2024 +4,8.4,"C-02",2024-06-24 15:28:49,50,3,0,202401,135,98,55.666145,-166.990255,2024 +3.2,7.6,"G-02",2024-06-25 07:08:01,31,3,0,202401,76,98,56.998795,-167.028725,2024 +3.2,7.7,"G-01",2024-06-25 10:36:58,31,3,0,202401,78,98,57.003825,-167.67794,2024 +2.9,6.4,"H-01",2024-06-25 14:15:31,31,3,0,202401,74,98,57.32459,-167.74625,2024 +2.5,5.1,"I-01",2024-06-26 07:34:20,31,3,0,202401,70,98,57.65,-167.734775,2024 +2.1,4.1,"J-01",2024-06-26 11:23:04,41,3,0,202401,68,98,57.9963,-167.80947,2024 +1.7,4,"K-18",2024-06-26 15:20:39,41,3,0,202401,65,98,58.33306,-168.41752,2024 +3,3.3,"L-18",2024-06-27 07:08:43,20,3,0,202401,54,98,58.670035,-168.49869,2024 +2.7,2.7,"M-18",2024-06-27 10:29:03,20,3,0,202401,46,98,58.98754,-168.50825,2024 +3,3,"N-18",2024-06-28 12:26:04,20,3,0,202401,42,98,59.327815,-168.54524,2024 +2.8,2.9,"O-18",2024-06-28 15:14:08,20,3,0,202401,40,98,59.64616,-168.592175,2024 +2.5,2.5,"P-18",2024-06-29 07:05:04,20,3,0,202401,39,98,59.982185,-168.65453,2024 +2.6,3,"Q-18",2024-06-29 10:12:32,20,3,0,202401,36,98,60.32788,-168.6713,2024 +1.7,2,"Q-19",2024-06-29 12:39:00,20,3,0,202401,43,98,60.33523,-169.30245,2024 +-0.4,2.7,"Q-20",2024-06-29 15:32:21,20,3,0,202401,52,98,60.33168,-169.99822,2024 +-1,3.1,"Q-21",2024-06-30 07:04:48,41,3,0,202401,62,98,60.33778,-170.676935,2024 +-0.6,3.3,"P-21",2024-06-30 09:51:53,41,3,0,202401,64,98,59.997985,-170.61746,2024 +1.4,3.1,"P-20",2024-06-30 12:48:58,41,3,0,202401,55,98,60.003115,-169.97254,2024 +0.3,3,"O-20",2024-06-30 15:40:15,41,3,0,202401,57,98,59.67604,-169.916035,2024 +-0.6,3.6,"O-21",2024-07-01 07:04:53,41,3,0,202401,67,98,59.664825,-170.57866,2024 +-0.3,3.7,"N-21",2024-07-01 09:45:53,41,3,0,202401,68,98,59.32916,-170.54091,2024 +0,4.5,"M-21",2024-07-01 12:42:38,41,3,0,202401,71,98,58.999655,-170.479225,2024 +1.8,4,"M-20",2024-07-01 15:35:23,41,3,0,202401,64,98,59.000275,-169.82382,2024 +2,5.4,"K-20",2024-07-02 07:06:33,41,3,0,202401,70,98,58.33258,-169.711775,2024 +2.6,5.2,"K-19",2024-07-02 10:00:32,41,3,0,202401,67,98,58.32795,-169.100975,2024 +2.7,5.2,"J-19",2024-07-02 12:52:36,42,3,0,202401,70,98,58.00461,-169.060615,2024 +3.2,4.8,"J-18",2024-07-02 15:50:28,42,3,0,202401,70,98,57.99477,-168.42431,2024 +2.1,5.3,"I-19",2024-07-03 07:05:34,42,3,0,202401,69,98,57.669165,-169.015615,2024 +3,5.1,"I-18",2024-07-03 09:51:27,42,3,0,202401,70,98,57.662825,-168.404495,2024 +2.9,6.2,"H-18",2024-07-03 12:53:06,32,3,0,202401,73,98,57.329085,-168.37235,2024 +3.3,5.7,"H-19",2024-07-04 07:05:55,42,3,1.12,202401,72,98,57.347025,-168.98097,2024 +3.2,5.9,"G-19",2024-07-04 10:21:22,32,3,0,202401,80,98,57.005255,-168.931545,2024 +3.3,6.3,"G-18",2024-07-04 13:26:46,32,3,0,202401,80,98,56.998,-168.33366,2024 +3.7,6.3,"F-18",2024-07-04 16:50:23,50,3,0,202401,106,98,56.6682,-168.26572,2024 +3.6,6.7,"F-01",2024-07-05 07:06:51,31,3,0,202401,102,98,56.664215,-167.660615,2024 +4.1,6.9,"E-01",2024-07-05 09:52:21,50,3,0,202401,127,98,56.335785,-167.630435,2024 +4,7.2,"D-01",2024-07-05 12:44:03,50,3,0,202401,132,98,55.99724,-167.60376,2024 +3.9,7.1,"D-18",2024-07-05 16:45:17,50,3,0,202401,146,98,55.99234,-168.166505,2024 +3.8,7.3,"E-22",2024-07-11 07:59:05,61,3,0,202401,120,98,56.34442,-170.65798,2024 +3.5,7.6,"F-22",2024-07-11 11:01:46,61,3,0,202401,113,98,56.67535,-170.718085,2024 +3.6,7.7,"F-23",2024-07-11 14:58:53,61,3,0,202401,119,98,56.663995,-171.28228,2024 +3.3,6.5,"G-22",2024-07-12 07:24:29,42,3,0,202401,94,98,57.008995,-170.7689,2024 +3.1,6.9,"H-22",2024-07-12 12:04:34,42,3,0,202401,83,98,57.351735,-170.842945,2024 +2.2,6.7,"I-22",2024-07-12 15:37:09,42,3,0,202401,85,98,57.672345,-170.8698,2024 +1.3,6.6,"J-22",2024-07-13 07:23:03,42,3,0,202401,87,98,58.00354,-170.97263,2024 +0.6,6.1,"K-22",2024-07-13 10:44:01,41,3,6,202401,83,98,58.32996,-170.999345,2024 +0.4,6.2,"L-22",2024-07-13 13:24:12,41,3,0,202401,83,98,58.662435,-171.07696,2024 +-0.2,6,"M-22",2024-07-13 16:15:43,41,3,0,202401,77,98,58.99115,-171.112965,2024 +-0.8,5.3,"O-22",2024-07-14 10:43:58,41,3,0,202401,72,98,59.672545,-171.26264,2024 +-0.7,5.4,"P-23",2024-07-14 16:07:11,43,3,0,202401,67,98,59.977455,-171.93012,2024 +-1,5.5,"P-22",2024-07-15 07:25:12,41,3,0,202401,69,98,59.99269,-171.27507,2024 +-1,5.5,"Q-22",2024-07-15 10:21:32,41,3,5,202401,66,98,60.32224,-171.3606,2024 +-1.2,5.8,"R-22",2024-07-15 13:30:57,41,3,6,202401,63,98,60.67741,-171.412055,2024 +-1.1,6.1,"S-22",2024-07-15 16:08:55,41,3,6,202401,60,98,60.988845,-171.46551,2024 +-1.2,6.2,"S-23",2024-07-16 07:22:05,41,3,0,202401,64,98,60.99908,-172.16373,2024 +-0.1,5.5,"S-24",2024-07-16 09:58:26,41,3,6,202401,66,98,60.99913,-172.81499,2024 +0.6,6.5,"S-25",2024-07-16 12:45:33,41,3,4,202401,75,98,60.994675,-173.49924,2024 +-0.1,6.3,"T-25",2024-07-16 16:00:45,82,3,0,202401,74,98,61.331215,-173.59209,2024 +-0.1,6.4,"U-25",2024-07-17 07:27:09,82,3,0,202401,70,98,61.66368,-173.668415,2024 +-1.6,6.1,"V-25",2024-07-17 10:20:57,82,3,0,202401,63,98,61.993165,-173.72929,2024 +-0.2,6,"V-26",2024-07-17 13:18:08,82,3,0,202401,73,98,62.000385,-174.48381,2024 +0.5,6.2,"U-26",2024-07-17 16:10:52,82,3,0,202401,77,98,61.6664,-174.42157,2024 +1.1,5.9,"V-28",2024-07-18 13:17:25,82,3,0,202401,92,98,61.99277,-175.84529,2024 +1.1,5.9,"U-28",2024-07-18 16:12:01,82,3,0,202401,96,98,61.673075,-175.78648,2024 +1.2,6.6,"T-28",2024-07-19 07:19:53,90,3,3.2,202401,98,98,61.34286,-175.701645,2024 +1.2,6.4,"T-27",2024-07-19 10:05:15,82,3,0,202401,88,98,61.33334,-175.038385,2024 +1.3,6.6,"S-27",2024-07-19 13:01:20,82,3,0,202401,93,98,61.009645,-174.94231,2024 +1.3,6.7,"S-28",2024-07-19 15:50:11,90,3,0,202401,103,98,61.00126,-175.551875,2024 +1.4,6.6,"R-28",2024-07-20 07:20:32,61,3,0,202401,109,98,60.65698,-175.50289,2024 +1.4,6.9,"R-27",2024-07-20 11:25:33,41,3,0,202401,98,98,60.659285,-174.831185,2024 +1.4,7,"Q-27",2024-07-20 15:10:48,62,3,0,202401,105,98,60.336845,-174.72454,2024 +1.3,6.9,"Q-26",2024-07-21 07:19:41,43,3,0,202401,91,98,60.32823,-174.076725,2024 +1.3,7.2,"P-26",2024-07-21 10:53:04,43,3,0,202401,97,98,59.998755,-173.976165,2024 +1.5,7.3,"P-27",2024-07-21 13:33:49,62,3,0,202401,107,98,60.006825,-174.593185,2024 +1.6,7.4,"O-27",2024-07-21 16:55:45,62,3,0,202401,115,98,59.66615,-174.434045,2024 +1.5,7.4,"O-26",2024-07-22 07:40:16,62,3,0,202401,106,98,59.67762,-173.90133,2024 +1.2,7.1,"O-25",2024-07-22 10:34:02,43,3,0,202401,96,98,59.665735,-173.259475,2024 +0.6,7.2,"O-24",2024-07-23 12:25:49,43,3,0,202401,84,98,59.66387,-172.543655,2024 +0.8,7.4,"N-24",2024-07-23 17:46:10,43,3,0,202401,88,98,59.334875,-172.4965,2024 +1.1,7.3,"M-24",2024-07-24 07:23:02,41,3,0,202401,99,98,59.00792,-172.4294,2024 +1.5,7.6,"M-25",2024-07-24 10:12:56,61,3,0,202401,107,98,59.000405,-173.07313,2024 +1.3,7.3,"N-25",2024-07-24 12:55:07,43,3,0,202401,100,98,59.328495,-173.136595,2024 +1.6,7.7,"N-26",2024-07-24 15:45:44,62,3,0,202401,110,98,59.33106,-173.802665,2024 +1.9,7.6,"N-27",2024-07-25 07:23:50,62,3,0,202401,121,98,59.33551,-174.45102,2024 +2.4,8,"N-28",2024-07-25 10:05:11,61,3,0,202401,133,98,59.336605,-175.08432,2024 +1.4,8.2,"N-29",2024-07-25 12:49:28,61,3,4,202401,137,98,59.335995,-175.746245,2024 +1.6,8.1,"M-29",2024-07-25 15:29:22,61,3,0,202401,134,98,59.004855,-175.73036,2024 +2.7,7.8,"L-29",2024-07-26 07:43:00,61,3,0,202401,136,98,58.654885,-175.557335,2024 +3.5,8.2,"L-28",2024-07-26 10:28:58,61,3,0,202401,192,98,58.68769,-174.939825,2024 +3.1,8,"L-27",2024-07-26 13:42:41,61,3,0,202401,157,98,58.66725,-174.274485,2024 +3.6,8.3,"K-27",2024-07-26 16:30:37,61,3,0,202401,176,98,58.33324,-174.318515,2024 +2.7,8.1,"K-26",2024-07-27 07:42:35,61,3,0,202401,116,98,58.329275,-173.58662,2024 +2.3,8.5,"K-25",2024-07-27 10:54:57,61,3,3.1,202401,110,98,58.33391,-172.930705,2024 +2.4,8.5,"J-25",2024-07-27 14:23:59,61,3,4.4,202401,109,98,58.004035,-172.82521,2024 +2.8,8.3,"J-26",2024-07-27 17:39:06,61,3,0,202401,118,98,57.992555,-173.45892,2024 +3.8,8.3,"I-26",2024-07-28 07:55:28,61,3,4.4,202401,148,98,57.65867,-173.40958,2024 +2.7,8.2,"I-25",2024-07-28 10:41:44,61,3,0,202401,119,98,57.662855,-172.788935,2024 +2.5,8.3,"I-24",2024-07-28 13:35:08,61,3,0,202401,108,98,57.666795,-172.17235,2024 +3.6,8.2,"G-26",2024-07-29 07:57:15,61,3,0,202401,141,98,56.993335,-173.239195,2024 +3.1,8.1,"G-25",2024-07-29 11:02:12,61,3,0,202401,122,98,57.00186,-172.66059,2024 +4,8.7,"E-18",2024-07-30 12:37:24,50,3,0,202401,155,98,56.305225,-168.241055,2024 3.4,3.3,"J-16",2023-05-28 07:24:09,10,3,0,202301,36,98,58.01142,-158.30451,2023 3.6,4,"I-16",2023-05-28 12:19:42,10,3,0,202301,36,98,57.66575,-158.37119,2023 4.1,4.5,"H-16",2023-05-28 15:09:13,10,3,0,202301,30,98,57.339335,-158.40438,2023 @@ -15064,23 +15431,6 @@ -0.8,9.1,"S-26",2023-07-25 10:20:59,41,3,0,202301,83,98,61.001515,-174.171245,2023 -1.1,9,"S-25",2023-07-25 13:16:25,41,3,0,202301,76,98,61.013605,-173.50151,2023 -1.3,9.1,"T-25",2023-07-25 15:45:00,82,3,0,202301,74,98,61.32351,-173.582735,2023 -0.4,1.7,"I-03",2012-06-19 11:22:51,31,3,0,201201,67,98,57.67309,-166.520505,2012 --0.8,3.5,"H-03",2012-06-19 13:51:55,31,3,0,201201,69,98,57.334535,-166.487615,2012 --0.6,3.8,"G-03",2012-06-19 16:44:50,31,3,0,201201,74,98,57.00918,-166.463175,2012 -0.2,4.3,"F-03",2012-06-20 06:42:06,31,3,0,201201,85,98,56.666915,-166.444885,2012 -1.9,4.2,"E-03",2012-06-20 09:13:36,31,3,0,201201,104,98,56.348175,-166.416175,2012 -2.5,4.9,"D-03",2012-06-20 11:54:31,50,3,0,201201,124,98,56.000595,-166.401075,2012 -2.9,5.6,"C-03",2012-06-20 14:22:34,50,3,0,201201,127,98,55.675975,-166.39253,2012 -2.9,5.7,"B-03",2012-06-20 17:02:58,50,3,0,201201,132,98,55.341465,-166.345015,2012 -3,5.7,"B-02",2012-06-23 09:09:53,50,3,0,201201,140,98,55.3439,-166.9672,2012 -3,5.8,"B-01",2012-06-23 12:07:54,50,3,0,201201,147,98,55.349265,-167.56274,2012 -2.9,6.1,"C-01",2012-06-23 14:42:31,50,3,0,201201,134,98,55.670175,-167.58641,2012 -2.9,5.7,"D-01",2012-06-24 06:44:23,50,3,0,201201,133,98,56.00386,-167.61022,2012 -2.8,5.5,"E-01",2012-06-24 09:18:56,50,3,0,201201,129,98,56.332615,-167.649425,2012 -1.4,4.7,"F-01",2012-06-24 11:50:59,31,3,0,201201,103,98,56.665175,-167.67072,2012 -0.2,4.2,"G-01",2012-06-24 14:26:39,31,3,0,201201,78,98,56.996435,-167.70525,2012 --0.4,4.3,"H-01",2012-06-24 17:03:43,31,3,0,201201,74,98,57.326935,-167.73854,2012 -0.5,3.2,"I-01",2012-06-25 06:33:49,31,3,0,201201,69,98,57.65845,-167.769965,2012 0.4,3.4,"J-01",2012-06-25 10:10:31,41,3,0,201201,67,98,57.993235,-167.80035,2012 1.1,3.3,"K-01",2012-06-25 13:33:35,41,3,0,201201,61,98,58.317755,-167.83193,2012 1.3,3.7,"K-02",2012-06-25 16:17:37,20,3,0,201201,53,98,58.32656,-167.19634,2012 diff --git a/data/index_hauls_temperature_data.csv b/data/index_hauls_temperature_data.csv index ad0e317..7be3cff 100644 --- a/data/index_hauls_temperature_data.csv +++ b/data/index_hauls_temperature_data.csv @@ -12590,6 +12590,183 @@ -0.8,8.5,"S-26",2022-07-28 16:27:01,41,3,0,202201,81,98,60.999555,-174.17599,2022 -0.7,8.3,"T-25",2022-07-29 08:08:54,82,3,0,202201,73,98,61.33369,-173.586225,2022 -1.1,8.3,"U-25",2022-07-29 11:02:58,82,3,0,202201,69,98,61.660095,-173.65809,2022 +4.2,4.5,"G-15",2024-06-02 07:15:36,10,3,0,202401,35,98,57.02667,-159.140585,2024 +3.6,3.8,"H-16",2024-06-02 10:48:58,10,3,0,202401,33,98,57.358825,-158.46611,2024 +4,3.9,"I-16",2024-06-02 13:41:05,10,3,0,202401,35,98,57.664895,-158.36291,2024 +3.4,3.6,"J-16",2024-06-02 16:48:23,10,3,0,202401,35,98,57.99211,-158.287675,2024 +2.9,3,"I-14",2024-06-03 10:08:10,10,3,0,202401,51,98,57.65542,-159.611065,2024 +3.2,3.6,"G-14",2024-06-03 15:57:06,10,3,0,202401,54,98,56.9879,-159.71058,2024 +4.1,4.1,"F-14",2024-06-04 07:12:25,10,3,0,202401,39,98,56.699445,-159.79043,2024 +3.3,4,"F-13",2024-06-04 11:05:37,31,3,0,202401,61,98,56.677065,-160.369445,2024 +3,3.1,"G-13",2024-06-04 14:34:00,31,3,0,202401,62,98,56.99746,-160.347825,2024 +2.8,2.9,"H-13",2024-06-05 12:53:21,31,3,0,202401,61,98,57.340245,-160.303585,2024 +3,3.3,"I-13",2024-06-05 15:40:19,31,3,0,202401,53,98,57.657975,-160.277325,2024 +2.8,2.9,"H-11",2024-06-06 11:35:53,31,3,0,202401,56,98,57.323175,-161.533355,2024 +2.7,3.2,"G-11",2024-06-06 14:35:35,31,3,0,202401,68,98,56.99949,-161.57536,2024 +3,4.1,"F-11",2024-06-07 10:33:56,31,3,0,202401,90,98,56.668675,-161.586515,2024 +3.8,4.1,"E-11",2024-06-07 13:38:18,10,3,0,202401,64,98,56.330765,-161.61906,2024 +2.5,2.4,"H-10",2024-06-08 07:09:31,10,3,0,202401,51,98,57.329525,-162.1554,2024 +2.4,2.5,"I-10",2024-06-08 14:48:56,10,3,0,202401,46,98,57.65236,-162.13112,2024 +3,2.9,"H-09",2024-06-09 10:03:48,10,3,0,202401,50,98,57.338485,-162.751815,2024 +2.9,3.1,"I-08",2024-06-10 12:07:44,10,3,0,202401,47,98,57.67579,-163.37932,2024 +3.1,3.5,"H-08",2024-06-10 14:51:08,10,3,0,202401,53,98,57.3377,-163.3816,2024 +2.7,3.8,"H-07",2024-06-11 07:12:31,31,3,0,202401,62,98,57.32974,-164.005365,2024 +2.5,4.5,"G-07",2024-06-11 09:57:31,31,3,0,202401,68,98,57.00512,-164.03519,2024 +3.1,4.5,"G-08",2024-06-11 13:01:06,31,3,0,202401,66,98,57.00696,-163.39423,2024 +2.4,5.1,"F-08",2024-06-11 15:45:20,31,3,0,202401,74,98,56.675725,-163.378685,2024 +2.9,4.5,"F-09",2024-06-12 07:16:38,31,3,0,202401,71,98,56.67318,-162.79239,2024 +2.9,4.9,"E-09",2024-06-12 09:57:57,31,3,0,202401,78,98,56.330995,-162.800615,2024 +3.6,5.8,"D-09",2024-06-12 12:53:34,31,3,0,202401,79,98,55.991815,-162.83022,2024 +3.8,4.6,"D-10",2024-06-12 15:27:58,31,3,0,202401,73,98,56.000085,-162.265665,2024 +4.3,5.8,"C-09",2024-06-13 07:11:08,10,3,0,202401,51,98,55.669555,-162.84062,2024 +3.8,6.2,"C-08",2024-06-13 09:54:55,31,3,0,202401,81,98,55.663915,-163.40441,2024 +3.4,6,"D-08",2024-06-13 12:36:51,31,3,0,202401,88,98,55.996685,-163.390125,2024 +3,5.6,"E-08",2024-06-13 15:12:50,31,3,0,202401,86,98,56.319255,-163.41755,2024 +3,4.8,"F-07",2024-06-14 07:12:35,31,3,0,202401,75,98,56.676535,-164.01583,2024 +3,5.6,"E-07",2024-06-14 09:56:35,31,3,0,202401,86,98,56.34098,-164.010755,2024 +3.6,6.1,"D-07",2024-06-14 12:37:29,31,3,0,202401,91,98,56.01202,-164.04593,2024 +3.7,6.3,"C-07",2024-06-14 15:16:06,31,3,0,202401,94,98,55.70172,-163.988215,2024 +4.3,5.9,"B-08",2024-06-15 07:09:10,31,3,0,202401,53,98,55.33813,-163.419955,2024 +4.3,6,"B-07",2024-06-15 09:59:17,31,3,0,202401,79,98,55.34226,-164.032485,2024 +4.8,6.1,"A-06",2024-06-18 07:26:07,31,3,0,202401,65,98,55.03802,-164.58019,2024 +4,7.5,"B-06",2024-06-18 10:51:00,31,3,0,202401,101,98,55.340965,-164.584445,2024 +4.4,7.3,"B-05",2024-06-18 14:05:23,50,3,0,202401,111,98,55.33487,-165.171085,2024 +4,6.8,"C-05",2024-06-18 16:44:57,31,3,0,202401,109,98,55.64179,-165.179785,2024 +3.9,7.7,"D-05",2024-06-19 07:07:16,31,3,0,202401,97,98,55.99192,-165.18467,2024 +3.6,7.8,"E-05",2024-06-19 10:13:11,31,3,0,202401,87,98,56.32921,-165.20127,2024 +3.3,8.4,"F-05",2024-06-19 13:01:20,31,3,0,202401,75,98,56.663115,-165.22412,2024 +3.4,7.9,"G-05",2024-06-19 15:40:13,31,3,0,202401,71,98,56.99093,-165.23024,2024 +3,7.4,"H-05",2024-06-20 07:05:34,31,3,0,202401,67,98,57.339045,-165.23377,2024 +2.6,6.9,"I-05",2024-06-20 09:49:16,31,3,0,202401,62,98,57.66026,-165.252765,2024 +2.7,6.3,"J-05",2024-06-20 12:43:31,10,3,0,202401,50,98,58.00232,-165.229615,2024 +3.1,6.1,"J-06",2024-06-20 15:29:54,10,3,0,202401,45,98,58.000255,-164.633545,2024 +2.9,5.7,"K-06",2024-06-21 07:04:41,10,3,0,202401,45,98,58.33517,-164.641995,2024 +2.5,5.6,"K-05",2024-06-21 09:52:52,10,3,0,202401,46,98,58.333745,-165.273865,2024 +2.5,6.1,"L-05",2024-06-21 12:40:33,10,3,0,202401,40,98,58.65937,-165.291085,2024 +3.5,5,"L-06",2024-06-21 15:33:41,10,3,0,202401,37,98,58.664985,-164.665495,2024 +4.7,5.2,"M-06",2024-06-22 07:03:28,10,3,0,202401,28,98,58.9876,-164.651675,2024 +5.7,7,"N-06",2024-06-22 09:34:49,10,3,0,202401,23,98,59.33168,-164.65962,2024 +5.4,5.4,"N-05",2024-06-22 12:15:02,20,3,0,202401,22,98,59.332985,-165.306015,2024 +4.9,5,"N-04",2024-06-22 14:40:31,20,3,0,202401,25,98,59.332635,-165.93776,2024 +3.7,3.8,"N-03",2024-06-23 07:01:46,20,3,0,202401,28,98,59.33962,-166.600345,2024 +4.1,4.1,"M-03",2024-06-23 09:38:46,20,3,0,202401,34,98,59.01233,-166.57744,2024 +2.1,5,"L-03",2024-06-23 12:18:57,20,3,0,202401,41,98,58.678865,-166.56293,2024 +1.8,5.6,"K-03",2024-06-23 15:05:19,10,3,0,202401,47,98,58.33653,-166.562545,2024 +3.2,8.7,"F-03",2024-06-24 07:04:51,31,3,0,202401,85,98,56.662055,-166.437835,2024 +3.9,8.6,"E-03",2024-06-24 09:51:37,31,3,0,202401,104,98,56.32899,-166.41313,2024 +3.9,8.7,"D-03",2024-06-24 12:32:06,50,3,0,202401,124,98,55.997275,-166.40984,2024 +4.1,8.8,"C-03",2024-06-24 15:05:23,50,3,0,202401,126,98,55.675895,-166.39333,2024 +3.1,8.4,"G-03",2024-06-25 07:03:38,31,3,0,202401,74,98,56.995925,-166.46256,2024 +2.8,6.7,"H-03",2024-06-25 09:47:01,31,3,0,202401,70,98,57.33559,-166.48555,2024 +2.7,6.8,"I-03",2024-06-25 12:32:19,31,3,0,202401,67,98,57.660605,-166.50083,2024 +2.9,5.3,"H-02",2024-06-26 07:04:18,31,3,0,202401,71,98,57.342685,-167.147005,2024 +2.5,4.6,"I-02",2024-06-26 10:30:00,31,3,0,202401,68,98,57.677215,-167.14485,2024 +1.8,4.7,"J-03",2024-06-26 16:29:24,31,3,0,202401,61,98,57.999575,-166.550895,2024 +1.8,3.6,"K-01",2024-06-27 07:00:21,41,3,0,202401,60,98,58.323775,-167.842185,2024 +2.7,3.3,"L-01",2024-06-27 10:47:53,20,3,0,202401,47,98,58.667145,-167.882535,2024 +3.4,3.3,"M-01",2024-06-28 07:02:19,20,3,0,202401,42,98,58.990345,-167.908565,2024 +3.1,3,"N-01",2024-06-28 10:19:58,20,3,0,202401,39,98,59.32064,-167.922135,2024 +3.6,3.7,"O-01",2024-06-29 07:03:02,20,3,0,202401,36,98,59.665165,-167.96704,2024 +3.7,3.6,"P-01",2024-06-29 09:52:59,20,3,0,202401,25,98,59.986945,-167.99501,2024 +4.8,5.5,"Q-01",2024-06-29 12:44:31,20,3,0,202401,32,98,60.337465,-167.99063,2024 +5.4,5.4,"Q-02",2024-06-29 15:29:20,20,3,0,202401,31,98,60.336115,-167.266205,2024 +1.8,2.1,"P-19",2024-06-30 07:00:35,20,3,0,202401,46,98,60.003815,-169.32454,2024 +2.5,2.6,"O-19",2024-06-30 09:34:58,20,3,0,202401,47,98,59.679475,-169.27622,2024 +2.6,3.3,"N-19",2024-06-30 12:18:03,20,3,0,202401,50,98,59.34784,-169.24497,2024 +0.6,3.8,"N-20",2024-06-30 15:05:56,41,3,0,202401,61,98,59.337725,-169.88018,2024 +2.6,3.6,"M-19",2024-07-01 07:13:32,41,3,0,202401,54,98,59.012005,-169.17384,2024 +1.9,4.2,"L-19",2024-07-01 10:03:10,41,3,0,202401,62,98,58.665165,-169.167515,2024 +1.6,3.7,"L-20",2024-07-01 12:55:32,41,3,0,202401,67,98,58.670385,-169.825565,2024 +0.4,4.5,"L-21",2024-07-01 16:11:07,41,3,0,202401,74,98,58.66899,-170.45196,2024 +0.6,4.8,"K-21",2024-07-02 07:00:12,41,3,0,202401,74,98,58.3305,-170.386525,2024 +0.6,4.9,"J-21",2024-07-02 10:30:08,42,3,0,202401,74,98,58.00055,-170.32673,2024 +1.7,5.3,"J-20",2024-07-02 13:37:38,42,3,0,202401,70,98,58.00022,-169.69412,2024 +1.7,5.6,"I-20",2024-07-02 16:42:25,42,3,0,202401,71,98,57.663815,-169.646285,2024 +1.2,4.9,"I-21",2024-07-03 07:01:37,42,3,0,202401,73,98,57.66549,-170.2594,2024 +3.7,4.4,"H-21",2024-07-03 12:39:19,42,3,0,202401,55,98,57.33382,-170.228255,2024 +1.6,4.7,"H-20",2024-07-03 15:38:35,42,3,0,202401,63,98,57.341895,-169.623945,2024 +2.2,2.5,"G-20",2024-07-04 07:00:05,42,3,0,202401,62,98,56.99735,-169.541185,2024 +4,5.7,"F-20",2024-07-04 12:34:30,32,3,0,202401,79,98,56.672345,-169.512675,2024 +3.3,6.5,"F-19",2024-07-04 15:35:38,32,3,0,202401,99,98,56.675425,-168.915045,2024 +3.9,6.7,"E-19",2024-07-05 10:01:21,50,3,0,202401,129,98,56.333935,-168.8793,2024 +4,7.4,"C-18",2024-07-06 07:01:43,50,3,0,202401,137,98,55.66771,-168.177185,2024 +3.9,7.7,"C-01",2024-07-06 10:12:26,50,3,0,202401,135,98,55.65978,-167.58632,2024 +3.9,7.3,"B-01",2024-07-06 12:47:08,50,3,0,202401,146,98,55.34627,-167.54205,2024 +3.8,8.4,"A-02",2024-07-06 16:42:33,50,3,0,202401,155,98,55.009745,-166.94512,2024 +3.9,7.6,"B-02",2024-07-07 07:06:45,50,3,0,202401,140,98,55.333825,-166.952855,2024 +4,7.8,"B-03",2024-07-07 10:04:45,50,3,0,202401,132,98,55.339635,-166.34736,2024 +3.9,8.2,"A-03",2024-07-07 12:48:46,50,3,0,202401,142,98,55.01761,-166.32564,2024 +4.3,7.4,"A-04",2024-07-07 15:49:09,50,3,1.12,202401,130,98,54.998625,-165.751935,2024 +3.9,5,"E-21",2024-07-11 07:35:03,50,3,0,202401,110,98,56.34758,-170.07738,2024 +3.8,6.1,"F-21",2024-07-11 11:03:08,42,3,0,202401,97,98,56.67025,-170.115525,2024 +3.8,4.2,"G-21",2024-07-11 14:02:29,42,3,0,202401,68,98,57.004665,-170.16301,2024 +2.8,7.1,"G-23",2024-07-12 07:37:00,61,3,0,202401,110,98,56.995435,-171.38766,2024 +2.7,7,"H-23",2024-07-12 11:56:42,41,3,0,202401,102,98,57.3309,-171.465835,2024 +2,7.2,"I-23",2024-07-12 14:54:19,41,3,1.12,202401,100,98,57.65023,-171.53237,2024 +1.6,7,"J-23",2024-07-12 17:43:23,41,3,0,202401,98,98,57.98725,-171.59457,2024 +1.3,6.6,"K-23",2024-07-13 07:35:09,41,3,0,202401,96,98,58.33113,-171.65338,2024 +0.9,6.4,"L-23",2024-07-13 10:24:18,41,3,0,202401,93,98,58.657515,-171.719075,2024 +0.5,6.2,"M-23",2024-07-13 13:06:35,41,3,0,202401,88,98,58.995255,-171.780515,2024 +-0.1,5.9,"N-23",2024-07-13 15:52:40,43,3,0,202401,81,98,59.32721,-171.831655,2024 +-0.5,5.5,"N-22",2024-07-14 07:41:04,41,3,0,202401,75,98,59.32789,-171.170985,2024 +-0.2,5.6,"O-23",2024-07-14 13:34:27,43,3,0,202401,78,98,59.6663,-171.8923,2024 +0.6,3.8,"Q-25",2024-07-15 07:40:25,43,3,0,202401,63,98,60.294685,-173.37399,2024 +0.4,5.7,"P-25",2024-07-15 09:57:17,43,3,0,202401,75,98,60.007985,-173.285785,2024 +-0.1,5,"P-24",2024-07-15 12:46:50,43,3,0,202401,67,98,59.990855,-172.594695,2024 +-0.4,6.1,"Q-23",2024-07-15 16:01:41,43,3,0,202401,59,98,60.329685,-172.06366,2024 +-1.3,6.2,"R-23",2024-07-16 07:36:27,41,3,0,202401,62,98,60.66331,-172.09063,2024 +2.5,6,"R-24",2024-07-16 10:26:55,41,3,0,202401,45,98,60.66979,-172.759305,2024 +0.4,6.8,"R-25",2024-07-17 07:35:44,41,3,0,202401,65,98,60.66667,-173.471775,2024 +1.1,6.8,"R-26",2024-07-17 10:22:08,41,3,0,202401,86,98,60.670955,-174.132245,2024 +0.7,6.7,"S-26",2024-07-17 12:59:00,41,3,0,202401,83,98,60.997075,-174.189045,2024 +0.8,6.7,"T-26",2024-07-17 15:39:54,82,3,0,202401,78,98,61.332835,-174.335405,2024 +1,6.1,"U-27",2024-07-18 07:35:13,82,3,0,202401,85,98,61.663205,-175.075535,2024 +0.9,5.8,"V-27",2024-07-18 10:28:31,82,3,0,202401,81,98,61.994765,-175.187575,2024 +0.9,6,"U-29",2024-07-19 07:37:04,90,3,0,202401,105,98,61.6632,-176.461455,2024 +1,6,"T-29",2024-07-19 10:29:58,90,3,0,202401,107,98,61.332685,-176.321675,2024 +1.3,6.4,"T-30",2024-07-19 13:07:13,90,3,0,202401,115,98,61.3372,-176.96549,2024 +0.9,7.1,"S-31",2024-07-19 16:51:12,90,3,0,202401,135,98,60.997025,-177.638415,2024 +0.9,6.7,"S-30",2024-07-20 07:40:03,90,3,0,202401,122,98,61.00753,-176.966795,2024 +1.2,6.5,"S-29",2024-07-20 11:12:26,90,3,0,202401,112,98,60.998605,-176.29293,2024 +1.3,7.2,"R-29",2024-07-20 14:36:54,61,3,0,202401,118,98,60.66905,-176.227565,2024 +1,7.4,"R-30",2024-07-21 07:38:24,61,3,0,202401,130,98,60.67018,-176.81101,2024 +0.9,7.5,"Q-30",2024-07-21 10:55:20,61,3,0,202401,137,98,60.338085,-176.71376,2024 +1.6,7.1,"Q-29",2024-07-21 14:02:43,61,3,0,202401,122,98,60.32975,-176.051885,2024 +1.5,7.2,"Q-28",2024-07-21 16:57:00,61,3,0,202401,111,98,60.336445,-175.40425,2024 +1.7,7.5,"P-28",2024-07-23 07:42:31,61,3,0,202401,117,98,60.00738,-175.26588,2024 +2.1,7.6,"O-28",2024-07-23 11:28:42,61,3,0,202401,126,98,59.669375,-175.13382,2024 +1.6,7.8,"O-29",2024-07-23 14:27:45,61,3,0,202401,136,98,59.66968,-175.864155,2024 +1.9,7.6,"P-29",2024-07-23 17:14:08,61,3,1.12,202401,129,98,59.984545,-175.92399,2024 +1,7.7,"P-30",2024-07-24 07:36:48,61,3,0,202401,142,98,60.005345,-176.71579,2024 +1.3,7.8,"O-30",2024-07-24 10:29:41,61,3,0,202401,137,98,59.67927,-176.53975,2024 +1.2,7.7,"N-30",2024-07-24 13:22:21,61,3,0,202401,136,98,59.348725,-176.387825,2024 +1.9,7.9,"M-30",2024-07-24 16:12:32,61,3,0,202401,135,98,59.00671,-176.31035,2024 +3.1,8.1,"M-32",2024-07-25 07:41:45,61,3,0,202401,135,98,58.99927,-177.61918,2024 +2.6,7.9,"M-31",2024-07-25 10:36:29,61,3,0,202401,136,98,58.99311,-176.95106,2024 +2.8,8.2,"L-31",2024-07-25 13:21:37,61,3,0,202401,135,98,58.67371,-176.828595,2024 +2.4,8.4,"L-30",2024-07-25 15:58:27,61,3,0,202401,140,98,58.66745,-176.21763,2024 +2.7,7.9,"M-28",2024-07-26 07:37:08,61,3,0,202401,130,98,59.010625,-175.022275,2024 +2.2,8,"M-27",2024-07-26 10:21:59,61,3,0,202401,127,98,59.003245,-174.37167,2024 +1.8,8.1,"M-26",2024-07-26 13:07:51,61,3,0,202401,118,98,59.00344,-173.716125,2024 +2.4,8.2,"L-26",2024-07-26 15:56:07,61,3,0,202401,126,98,58.68028,-173.63641,2024 +2,8.2,"L-25",2024-07-27 07:33:35,61,3,0,202401,113,98,58.668495,-173.00771,2024 +1.7,8,"L-24",2024-07-27 10:33:38,61,3,0,202401,102,98,58.669155,-172.36943,2024 +1.9,8.3,"K-24",2024-07-27 14:43:23,61,3,0,202401,103,98,58.31751,-172.305235,2024 +2.1,8.3,"J-24",2024-07-27 17:26:17,61,3,0,202401,105,98,58.003415,-172.256595,2024 +3.2,8.3,"H-26",2024-07-28 07:41:41,61,3,0,202401,122,98,57.32448,-173.339375,2024 +3,8.3,"H-25",2024-07-28 10:24:12,61,3,0,202401,117,98,57.351085,-172.812795,2024 +2.8,8.2,"H-24",2024-07-28 13:47:26,61,3,0,202401,109,98,57.33674,-172.081525,2024 +3.7,8.3,"F-25",2024-07-29 08:08:06,61,3,0,202401,135,98,56.67495,-172.560765,2024 +3.6,8,"F-24",2024-07-29 11:10:16,61,3,0,202401,126,98,56.66735,-171.97018,2024 +3.3,8.3,"G-24",2024-07-29 14:37:32,61,3,0,202401,118,98,56.99549,-172.03074,2024 +4.1,8.2,"E-20",2024-07-30 07:54:04,50,3,0,202401,138,98,56.33889,-169.324885,2024 +2.4,8.7,"N-31",2024-08-04 08:43:09,61,3,0,202401,149,98,59.336835,-177.026545,2024 +3.6,8.7,"O-31",2024-08-04 11:56:54,61,3,0,202401,176,98,59.659545,-177.14104,2024 +1.8,8.9,"P-32",2024-08-04 16:31:49,61,3,0,202401,141,98,60.022165,-177.8714,2024 +1.1,8.7,"P-31",2024-08-05 08:42:21,61,3,0,202401,137,98,60.000365,-177.19938,2024 +1.5,8.8,"Q-31",2024-08-05 11:50:50,61,3,0,202401,147,98,60.32688,-177.374215,2024 +0.8,8.8,"R-31",2024-08-05 15:09:09,61,3,0,202401,147,98,60.664945,-177.523365,2024 +2.5,8.8,"R-32",2024-08-05 18:33:31,61,3,0,202401,159,98,60.64997,-178.14495,2024 4,4.1,"G-15",2011-06-05 09:23:32,10,3,0,201101,34,98,56.99431,-159.13964,2011 2.7,2.9,"H-15",2011-06-05 12:51:42,10,3,0,201101,49,98,57.33971,-159.064975,2011 2.5,3,"I-15",2011-06-05 16:05:08,10,3,0,201101,47,98,57.681225,-159.017275,2011 @@ -13342,6 +13519,179 @@ 1,10.9,"U-27",2019-07-28 07:37:18,82,3,0,201901,85,98,61.65876,-175.079595,2019 0.4,10.8,"V-27",2019-07-28 10:12:52,82,3,0,201901,80,98,61.999075,-175.172015,2019 1.2,10.6,"V-28",2019-07-28 12:37:24,82,3,0,201901,91,98,62.00035,-175.80656,2019 +3.6,3.6,"H-15",2024-06-02 07:19:22,10,3,0,202401,49,98,57.33521,-159.05093,2024 +2.9,2.9,"I-15",2024-06-02 10:31:06,10,3,0,202401,48,98,57.6738,-159.02217,2024 +2.8,2.9,"J-15",2024-06-02 13:18:46,10,3,0,202401,40,98,57.9781,-158.99151,2024 +3.7,5.3,"K-14",2024-06-02 17:03:55,10,3,0,202401,23,98,58.34026,-159.542335,2024 +2,2.1,"J-14",2024-06-03 07:18:28,10,3,0,202401,43,98,58.000465,-159.574975,2024 +2.8,3.6,"H-14",2024-06-03 12:59:40,10,3,0,202401,55,98,57.326955,-159.687635,2024 +3.7,4.7,"E-12",2024-06-04 07:12:16,10,3,0,202401,55,98,56.348355,-161.00501,2024 +3.1,3.7,"F-12",2024-06-04 14:31:45,31,3,0,202401,68,98,56.668665,-160.97944,2024 +3,3,"G-12",2024-06-05 07:18:05,31,3,0,202401,67,98,56.99437,-160.94989,2024 +2.7,2.8,"H-12",2024-06-05 10:22:45,31,3,0,202401,66,98,57.33555,-160.899965,2024 +2.6,2.8,"I-12",2024-06-05 14:38:12,31,3,0,202401,56,98,57.66746,-160.88276,2024 +2.1,2.5,"J-12",2024-06-05 17:32:03,10,3,0,202401,44,98,58.000315,-160.843555,2024 +2.1,2.7,"J-13",2024-06-06 07:10:52,10,3,0,202401,52,98,58.002705,-160.22353,2024 +2.4,3.7,"K-13",2024-06-06 09:58:50,10,3,2.4,202401,37,98,58.268655,-160.002075,2024 +3.6,4.3,"K-12",2024-06-06 13:16:09,10,3,0,202401,31,98,58.28574,-160.80615,2024 +2.8,3.3,"K-11",2024-06-06 16:23:27,10,3,0,202401,40,98,58.21639,-161.54697,2024 +3.6,3.6,"K-10",2024-06-07 07:09:05,10,3,0,202401,49,98,58.32506,-162.08567,2024 +2.3,2.2,"J-10",2024-06-07 10:13:32,10,3,0,202401,39,98,58.000285,-162.12108,2024 +2.1,2.1,"J-11",2024-06-07 13:20:44,10,3,0,202401,55,98,57.98732,-161.47314,2024 +2.1,2.2,"I-11",2024-06-07 16:11:41,10,3,0,202401,52,98,57.6706,-161.498995,2024 +3.2,3.2,"G-10",2024-06-08 07:12:16,31,3,2.4,202401,61,98,56.991315,-162.169275,2024 +3.3,3.5,"F-10",2024-06-08 12:41:07,31,3,0,202401,71,98,56.66961,-162.169375,2024 +3.5,3.6,"E-10",2024-06-08 15:25:01,31,3,3.13,202401,78,98,56.33036,-162.200475,2024 +3.3,3.3,"G-09",2024-06-09 07:16:40,31,3,0,202401,61,98,56.996945,-162.7908,2024 +2.7,2.9,"I-09",2024-06-10 13:09:11,10,3,0,202401,44,98,57.669715,-162.744165,2024 +2.4,3,"J-09",2024-06-10 15:57:46,10,3,0,202401,42,98,58.00088,-162.72135,2024 +3,3,"K-09",2024-06-11 07:09:33,10,3,0,202401,32,98,58.325825,-162.70471,2024 +3.3,3.3,"L-09",2024-06-11 09:41:42,10,3,0,202401,27,98,58.64318,-162.723705,2024 +3.2,3.2,"L-08",2024-06-11 12:24:51,10,3,0,202401,33,98,58.679425,-163.345805,2024 +4.6,4.8,"M-08",2024-06-11 14:54:55,10,3,0,202401,24,98,58.992885,-163.369365,2024 +4.9,6.8,"N-07",2024-06-12 06:54:56,10,3,0,202401,21,98,59.32704,-164.00025,2024 +3.3,4.1,"M-07",2024-06-12 09:26:31,10,3,0,202401,28,98,59.003495,-164.003685,2024 +3.1,3.1,"L-07",2024-06-12 12:14:49,10,3,0,202401,35,98,58.67605,-164.004875,2024 +2.6,2.8,"K-07",2024-06-12 15:18:19,10,3,0,202401,43,98,58.32074,-163.95177,2024 +2.6,2.9,"K-08",2024-06-12 17:47:54,10,3,0,202401,37,98,58.32404,-163.381355,2024 +2.6,2.8,"J-08",2024-06-13 07:13:19,10,3,0,202401,42,98,57.999925,-163.351225,2024 +2.7,3.1,"J-07",2024-06-13 10:03:26,10,3,0,202401,47,98,57.992205,-164.01121,2024 +3.4,4.1,"I-07",2024-06-13 12:58:23,10,3,0,202401,51,98,57.66923,-164.01268,2024 +2.9,3.8,"I-06",2024-06-13 15:41:52,10,3,0,202401,54,98,57.658835,-164.62789,2024 +2.8,4.2,"H-06",2024-06-14 07:11:42,31,3,0,202401,65,98,57.34003,-164.62111,2024 +3.2,4.4,"G-06",2024-06-14 10:09:22,31,3,0,202401,69,98,56.98833,-164.61554,2024 +3.3,4.6,"F-06",2024-06-14 12:54:19,31,3,0,202401,75,98,56.66616,-164.60419,2024 +3.5,5.8,"E-06",2024-06-14 15:48:45,31,3,0,202401,87,98,56.333375,-164.58716,2024 +3.8,6.1,"D-06",2024-06-15 07:10:39,31,3,0,202401,93,98,55.99759,-164.59125,2024 +4,6.2,"C-06",2024-06-15 10:01:08,31,3,0,202401,96,98,55.672025,-164.59845,2024 +5.4,5.6,"Z-05",2024-06-18 07:10:32,31,3,0,202401,84,98,54.6836,-165.15957,2024 +3.8,5.8,"AZ0504",2024-06-18 10:56:04,50,3,0,202401,159,98,54.82531,-165.5175,2024 +4.3,6.8,"A-05",2024-06-18 14:03:41,50,3,0,202401,111,98,54.99662,-165.156085,2024 +3.9,7.4,"B-04",2024-06-18 17:45:34,50,3,0,202401,122,98,55.32571,-165.782545,2024 +4,7.7,"C-04",2024-06-19 08:04:32,50,3,0,202401,118,98,55.639075,-165.78841,2024 +3.9,8.3,"D-04",2024-06-19 11:04:07,31,3,0,202401,107,98,55.99856,-165.78202,2024 +3.8,8.1,"E-04",2024-06-19 13:46:41,31,3,0,202401,92,98,56.32654,-165.810715,2024 +2.9,7.5,"F-04",2024-06-19 16:24:28,31,3,0,202401,79,98,56.6562,-165.83246,2024 +3.2,8.3,"G-04",2024-06-20 07:09:25,31,3,0,202401,73,98,56.97778,-165.844305,2024 +3,7.4,"H-04",2024-06-20 10:00:56,31,3,0,202401,69,98,57.32418,-165.85189,2024 +2.7,6.9,"I-04",2024-06-20 12:55:56,31,3,0,202401,64,98,57.67546,-165.860355,2024 +2.2,6.4,"J-04",2024-06-20 15:48:21,10,3,0,202401,55,98,58.00762,-165.888795,2024 +2.3,5.4,"K-04",2024-06-21 07:06:55,10,3,0,202401,44,98,58.33986,-165.89499,2024 +2.7,5.3,"L-04",2024-06-21 09:49:19,10,3,0,202401,38,98,58.67455,-165.90797,2024 +3.8,3.9,"M-04",2024-06-21 12:45:14,20,3,0,202401,31,98,58.99941,-165.95284,2024 +4.3,4.5,"M-05",2024-06-21 16:01:32,10,3,0,202401,28,98,59.002555,-165.29917,2024 +5.6,5.8,"O-04",2024-06-22 07:08:28,20,3,0,202401,27,98,59.628115,-165.92081,2024 +4.9,5,"O-03",2024-06-22 10:07:56,20,3,0,202401,28,98,59.66574,-166.6228,2024 +3.4,3.5,"O-02",2024-06-22 12:50:20,20,3,0,202401,32,98,59.65289,-167.26951,2024 +3.6,3.8,"N-02",2024-06-22 15:30:53,20,3,0,202401,31,98,59.34348,-167.24194,2024 +2.4,5.1,"M-02",2024-06-23 07:08:57,20,3,0,202401,40,98,58.99033,-167.238965,2024 +2.1,5.7,"L-02",2024-06-23 09:43:42,20,3,0,202401,44,98,58.682905,-167.230235,2024 +1.6,5.6,"K-02",2024-06-23 12:42:19,20,3,0,202401,52,98,58.32416,-167.191935,2024 +2,6.6,"J-02",2024-06-23 15:42:05,31,3,0,202401,63,98,57.991395,-167.139245,2024 +3.4,8.4,"F-02",2024-06-24 07:08:31,31,3,0,202401,96,98,56.67118,-167.060095,2024 +4,8.5,"E-02",2024-06-24 09:56:37,50,3,0,202401,113,98,56.33654,-167.01848,2024 +4.2,8.3,"D-02",2024-06-24 12:39:08,50,3,0,202401,134,98,56.002575,-166.996845,2024 +4,8.4,"C-02",2024-06-24 15:28:49,50,3,0,202401,135,98,55.666145,-166.990255,2024 +3.2,7.6,"G-02",2024-06-25 07:08:01,31,3,0,202401,76,98,56.998795,-167.028725,2024 +3.2,7.7,"G-01",2024-06-25 10:36:58,31,3,0,202401,78,98,57.003825,-167.67794,2024 +2.9,6.4,"H-01",2024-06-25 14:15:31,31,3,0,202401,74,98,57.32459,-167.74625,2024 +2.5,5.1,"I-01",2024-06-26 07:34:20,31,3,0,202401,70,98,57.65,-167.734775,2024 +2.1,4.1,"J-01",2024-06-26 11:23:04,41,3,0,202401,68,98,57.9963,-167.80947,2024 +1.7,4,"K-18",2024-06-26 15:20:39,41,3,0,202401,65,98,58.33306,-168.41752,2024 +3,3.3,"L-18",2024-06-27 07:08:43,20,3,0,202401,54,98,58.670035,-168.49869,2024 +2.7,2.7,"M-18",2024-06-27 10:29:03,20,3,0,202401,46,98,58.98754,-168.50825,2024 +3,3,"N-18",2024-06-28 12:26:04,20,3,0,202401,42,98,59.327815,-168.54524,2024 +2.8,2.9,"O-18",2024-06-28 15:14:08,20,3,0,202401,40,98,59.64616,-168.592175,2024 +2.5,2.5,"P-18",2024-06-29 07:05:04,20,3,0,202401,39,98,59.982185,-168.65453,2024 +2.6,3,"Q-18",2024-06-29 10:12:32,20,3,0,202401,36,98,60.32788,-168.6713,2024 +1.7,2,"Q-19",2024-06-29 12:39:00,20,3,0,202401,43,98,60.33523,-169.30245,2024 +-0.4,2.7,"Q-20",2024-06-29 15:32:21,20,3,0,202401,52,98,60.33168,-169.99822,2024 +-1,3.1,"Q-21",2024-06-30 07:04:48,41,3,0,202401,62,98,60.33778,-170.676935,2024 +-0.6,3.3,"P-21",2024-06-30 09:51:53,41,3,0,202401,64,98,59.997985,-170.61746,2024 +1.4,3.1,"P-20",2024-06-30 12:48:58,41,3,0,202401,55,98,60.003115,-169.97254,2024 +0.3,3,"O-20",2024-06-30 15:40:15,41,3,0,202401,57,98,59.67604,-169.916035,2024 +-0.6,3.6,"O-21",2024-07-01 07:04:53,41,3,0,202401,67,98,59.664825,-170.57866,2024 +-0.3,3.7,"N-21",2024-07-01 09:45:53,41,3,0,202401,68,98,59.32916,-170.54091,2024 +0,4.5,"M-21",2024-07-01 12:42:38,41,3,0,202401,71,98,58.999655,-170.479225,2024 +1.8,4,"M-20",2024-07-01 15:35:23,41,3,0,202401,64,98,59.000275,-169.82382,2024 +2,5.4,"K-20",2024-07-02 07:06:33,41,3,0,202401,70,98,58.33258,-169.711775,2024 +2.6,5.2,"K-19",2024-07-02 10:00:32,41,3,0,202401,67,98,58.32795,-169.100975,2024 +2.7,5.2,"J-19",2024-07-02 12:52:36,42,3,0,202401,70,98,58.00461,-169.060615,2024 +3.2,4.8,"J-18",2024-07-02 15:50:28,42,3,0,202401,70,98,57.99477,-168.42431,2024 +2.1,5.3,"I-19",2024-07-03 07:05:34,42,3,0,202401,69,98,57.669165,-169.015615,2024 +3,5.1,"I-18",2024-07-03 09:51:27,42,3,0,202401,70,98,57.662825,-168.404495,2024 +2.9,6.2,"H-18",2024-07-03 12:53:06,32,3,0,202401,73,98,57.329085,-168.37235,2024 +3.3,5.7,"H-19",2024-07-04 07:05:55,42,3,1.12,202401,72,98,57.347025,-168.98097,2024 +3.2,5.9,"G-19",2024-07-04 10:21:22,32,3,0,202401,80,98,57.005255,-168.931545,2024 +3.3,6.3,"G-18",2024-07-04 13:26:46,32,3,0,202401,80,98,56.998,-168.33366,2024 +3.7,6.3,"F-18",2024-07-04 16:50:23,50,3,0,202401,106,98,56.6682,-168.26572,2024 +3.6,6.7,"F-01",2024-07-05 07:06:51,31,3,0,202401,102,98,56.664215,-167.660615,2024 +4.1,6.9,"E-01",2024-07-05 09:52:21,50,3,0,202401,127,98,56.335785,-167.630435,2024 +4,7.2,"D-01",2024-07-05 12:44:03,50,3,0,202401,132,98,55.99724,-167.60376,2024 +3.9,7.1,"D-18",2024-07-05 16:45:17,50,3,0,202401,146,98,55.99234,-168.166505,2024 +3.8,7.3,"E-22",2024-07-11 07:59:05,61,3,0,202401,120,98,56.34442,-170.65798,2024 +3.5,7.6,"F-22",2024-07-11 11:01:46,61,3,0,202401,113,98,56.67535,-170.718085,2024 +3.6,7.7,"F-23",2024-07-11 14:58:53,61,3,0,202401,119,98,56.663995,-171.28228,2024 +3.3,6.5,"G-22",2024-07-12 07:24:29,42,3,0,202401,94,98,57.008995,-170.7689,2024 +3.1,6.9,"H-22",2024-07-12 12:04:34,42,3,0,202401,83,98,57.351735,-170.842945,2024 +2.2,6.7,"I-22",2024-07-12 15:37:09,42,3,0,202401,85,98,57.672345,-170.8698,2024 +1.3,6.6,"J-22",2024-07-13 07:23:03,42,3,0,202401,87,98,58.00354,-170.97263,2024 +0.6,6.1,"K-22",2024-07-13 10:44:01,41,3,6,202401,83,98,58.32996,-170.999345,2024 +0.4,6.2,"L-22",2024-07-13 13:24:12,41,3,0,202401,83,98,58.662435,-171.07696,2024 +-0.2,6,"M-22",2024-07-13 16:15:43,41,3,0,202401,77,98,58.99115,-171.112965,2024 +-0.8,5.3,"O-22",2024-07-14 10:43:58,41,3,0,202401,72,98,59.672545,-171.26264,2024 +-0.7,5.4,"P-23",2024-07-14 16:07:11,43,3,0,202401,67,98,59.977455,-171.93012,2024 +-1,5.5,"P-22",2024-07-15 07:25:12,41,3,0,202401,69,98,59.99269,-171.27507,2024 +-1,5.5,"Q-22",2024-07-15 10:21:32,41,3,5,202401,66,98,60.32224,-171.3606,2024 +-1.2,5.8,"R-22",2024-07-15 13:30:57,41,3,6,202401,63,98,60.67741,-171.412055,2024 +-1.1,6.1,"S-22",2024-07-15 16:08:55,41,3,6,202401,60,98,60.988845,-171.46551,2024 +-1.2,6.2,"S-23",2024-07-16 07:22:05,41,3,0,202401,64,98,60.99908,-172.16373,2024 +-0.1,5.5,"S-24",2024-07-16 09:58:26,41,3,6,202401,66,98,60.99913,-172.81499,2024 +0.6,6.5,"S-25",2024-07-16 12:45:33,41,3,4,202401,75,98,60.994675,-173.49924,2024 +-0.1,6.3,"T-25",2024-07-16 16:00:45,82,3,0,202401,74,98,61.331215,-173.59209,2024 +-0.1,6.4,"U-25",2024-07-17 07:27:09,82,3,0,202401,70,98,61.66368,-173.668415,2024 +-1.6,6.1,"V-25",2024-07-17 10:20:57,82,3,0,202401,63,98,61.993165,-173.72929,2024 +-0.2,6,"V-26",2024-07-17 13:18:08,82,3,0,202401,73,98,62.000385,-174.48381,2024 +0.5,6.2,"U-26",2024-07-17 16:10:52,82,3,0,202401,77,98,61.6664,-174.42157,2024 +1.1,5.9,"V-28",2024-07-18 13:17:25,82,3,0,202401,92,98,61.99277,-175.84529,2024 +1.1,5.9,"U-28",2024-07-18 16:12:01,82,3,0,202401,96,98,61.673075,-175.78648,2024 +1.2,6.6,"T-28",2024-07-19 07:19:53,90,3,3.2,202401,98,98,61.34286,-175.701645,2024 +1.2,6.4,"T-27",2024-07-19 10:05:15,82,3,0,202401,88,98,61.33334,-175.038385,2024 +1.3,6.6,"S-27",2024-07-19 13:01:20,82,3,0,202401,93,98,61.009645,-174.94231,2024 +1.3,6.7,"S-28",2024-07-19 15:50:11,90,3,0,202401,103,98,61.00126,-175.551875,2024 +1.4,6.6,"R-28",2024-07-20 07:20:32,61,3,0,202401,109,98,60.65698,-175.50289,2024 +1.4,6.9,"R-27",2024-07-20 11:25:33,41,3,0,202401,98,98,60.659285,-174.831185,2024 +1.4,7,"Q-27",2024-07-20 15:10:48,62,3,0,202401,105,98,60.336845,-174.72454,2024 +1.3,6.9,"Q-26",2024-07-21 07:19:41,43,3,0,202401,91,98,60.32823,-174.076725,2024 +1.3,7.2,"P-26",2024-07-21 10:53:04,43,3,0,202401,97,98,59.998755,-173.976165,2024 +1.5,7.3,"P-27",2024-07-21 13:33:49,62,3,0,202401,107,98,60.006825,-174.593185,2024 +1.6,7.4,"O-27",2024-07-21 16:55:45,62,3,0,202401,115,98,59.66615,-174.434045,2024 +1.5,7.4,"O-26",2024-07-22 07:40:16,62,3,0,202401,106,98,59.67762,-173.90133,2024 +1.2,7.1,"O-25",2024-07-22 10:34:02,43,3,0,202401,96,98,59.665735,-173.259475,2024 +0.6,7.2,"O-24",2024-07-23 12:25:49,43,3,0,202401,84,98,59.66387,-172.543655,2024 +0.8,7.4,"N-24",2024-07-23 17:46:10,43,3,0,202401,88,98,59.334875,-172.4965,2024 +1.1,7.3,"M-24",2024-07-24 07:23:02,41,3,0,202401,99,98,59.00792,-172.4294,2024 +1.5,7.6,"M-25",2024-07-24 10:12:56,61,3,0,202401,107,98,59.000405,-173.07313,2024 +1.3,7.3,"N-25",2024-07-24 12:55:07,43,3,0,202401,100,98,59.328495,-173.136595,2024 +1.6,7.7,"N-26",2024-07-24 15:45:44,62,3,0,202401,110,98,59.33106,-173.802665,2024 +1.9,7.6,"N-27",2024-07-25 07:23:50,62,3,0,202401,121,98,59.33551,-174.45102,2024 +2.4,8,"N-28",2024-07-25 10:05:11,61,3,0,202401,133,98,59.336605,-175.08432,2024 +1.4,8.2,"N-29",2024-07-25 12:49:28,61,3,4,202401,137,98,59.335995,-175.746245,2024 +1.6,8.1,"M-29",2024-07-25 15:29:22,61,3,0,202401,134,98,59.004855,-175.73036,2024 +2.7,7.8,"L-29",2024-07-26 07:43:00,61,3,0,202401,136,98,58.654885,-175.557335,2024 +3.5,8.2,"L-28",2024-07-26 10:28:58,61,3,0,202401,192,98,58.68769,-174.939825,2024 +3.1,8,"L-27",2024-07-26 13:42:41,61,3,0,202401,157,98,58.66725,-174.274485,2024 +3.6,8.3,"K-27",2024-07-26 16:30:37,61,3,0,202401,176,98,58.33324,-174.318515,2024 +2.7,8.1,"K-26",2024-07-27 07:42:35,61,3,0,202401,116,98,58.329275,-173.58662,2024 +2.3,8.5,"K-25",2024-07-27 10:54:57,61,3,3.1,202401,110,98,58.33391,-172.930705,2024 +2.4,8.5,"J-25",2024-07-27 14:23:59,61,3,4.4,202401,109,98,58.004035,-172.82521,2024 +2.8,8.3,"J-26",2024-07-27 17:39:06,61,3,0,202401,118,98,57.992555,-173.45892,2024 +3.8,8.3,"I-26",2024-07-28 07:55:28,61,3,4.4,202401,148,98,57.65867,-173.40958,2024 +2.7,8.2,"I-25",2024-07-28 10:41:44,61,3,0,202401,119,98,57.662855,-172.788935,2024 +2.5,8.3,"I-24",2024-07-28 13:35:08,61,3,0,202401,108,98,57.666795,-172.17235,2024 +3.6,8.2,"G-26",2024-07-29 07:57:15,61,3,0,202401,141,98,56.993335,-173.239195,2024 +3.1,8.1,"G-25",2024-07-29 11:02:12,61,3,0,202401,122,98,57.00186,-172.66059,2024 +4,8.7,"E-18",2024-07-30 12:37:24,50,3,0,202401,155,98,56.305225,-168.241055,2024 3.4,3.5,"H-15",2013-06-09 06:27:28,10,3,0,201301,49,98,57.338275,-159.06781,2013 3.5,3.7,"I-15",2013-06-09 09:09:52,10,3,0,201301,47,98,57.674645,-159.018675,2013 4,6.5,"J-15",2013-06-09 11:45:31,10,3,0,201301,41,98,58.005975,-158.96603,2013 diff --git a/man/cold_pool_index.Rd b/man/cold_pool_index.Rd index ead5edb..25f1397 100644 --- a/man/cold_pool_index.Rd +++ b/man/cold_pool_index.Rd @@ -8,11 +8,11 @@ A data frame with 39 rows and 9 columns. \describe{ \item{YEAR}{Year} - \item{AREA_LTE2_KM2}{Cold Pool Index. Total area with bottom temperatures less than or equal to 2 celsius, in square kilometers} - \item{AREA_LTE1_KM2}{Total area with bottom temperatures less than or equal to 1 celsius, in square kilometers} - \item{AREA_LTE0_KM2}{Total area with bottom temperatures less than or equal to 0 celsius, in square kilometers} - \item{AREA_LTEMINUS1_KM2}{Total area with bottom temperatures less than or equal to -1 celsius, in square kilometers} - \item{MEAN_GEAR_TEMPERATURE}{Mean gear temperature (i.e. bottom temperature) in the survey area.} + \item{AREA_LTE2_KM2}{Cold Pool Index. Total area with bottom temperatures less than or equal to 2 celsius, in square kilometers, in the EBS shelf survey area.} + \item{AREA_LTE1_KM2}{Total area with bottom temperatures less than or equal to 1 celsius, in square kilometers, in the EBS shelf survey area.} + \item{AREA_LTE0_KM2}{Total area with bottom temperatures less than or equal to 0 celsius, in square kilometers, in the EBS shelf survey area.} + \item{AREA_LTEMINUS1_KM2}{Total area with bottom temperatures less than or equal to -1 celsius, in square kilometers, in the EBS shelf survey area.} + \item{MEAN_GEAR_TEMPERATURE}{Mean gear temperature (i.e. bottom temperature) in the EBS shelf survey area.} \item{MEAN_SURFACE_TEMPERATURE}{Mean sea surface temperature in the survey area.} \item{MEAN_BT_LT100M}{Mean gear temperature (i.e. bottom temperature) for EBS shelf *STANDARD* strata (i.e., excluding northwest strata 82 and 90) with bottom depth less than 100 m (strata 10, 20, 31, 32, 41, 42, 43).} \item{LAST_UPDATE}{Date when cold pool index and temperature rasters were last updated.} diff --git a/man/nbs_mean_temperature.Rd b/man/nbs_mean_temperature.Rd index 6d8a16c..8e10495 100644 --- a/man/nbs_mean_temperature.Rd +++ b/man/nbs_mean_temperature.Rd @@ -8,8 +8,12 @@ A data frame with 4 rows and 4 columns. \describe{ \item{YEAR}{Year} - \item{MEAN_GEAR_TEMPERATURE}{Mean gear temperature (i.e. bottom temperature) in the survey area.} - \item{MEAN_SURFACE_TEMPERATURE}{Mean sea surface temperature in the survey area.} + \item{MEAN_GEAR_TEMPERATURE}{Mean gear temperature (i.e. bottom temperature) in the NBS survey area.} + \item{MEAN_SURFACE_TEMPERATURE}{Mean sea surface temperature in the NBS survey area.} + \item{AREA_LTE2_KM2}{Total area with bottom temperatures less than or equal to 2 celsius, in square kilometers, in the NBS survey area.} + \item{AREA_LTE1_KM2}{Total area with bottom temperatures less than or equal to 1 celsius, in square kilometers, in the NBS survey area.} + \item{AREA_LTE0_KM2}{Total area with bottom temperatures less than or equal to 0 celsius, in square kilometers, in the NBS survey area.} + \item{AREA_LTEMINUS1_KM2}{Total area with bottom temperatures less than or equal to -1 celsius, in square kilometers, in the NBS survey area.} \item{LAST_UPDATE}{Date when cold pool index and temperature rasters were last updated.} } } diff --git a/man/vgm_fn.Rd b/man/vgm_fn.Rd new file mode 100644 index 0000000..85b29cd --- /dev/null +++ b/man/vgm_fn.Rd @@ -0,0 +1,24 @@ +% Generated by roxygen2: do not edit by hand +% Please edit documentation in R/vgm_fn.R +\name{vgm_fn} +\alias{vgm_fn} +\title{Variogram function} +\usage{ +vgm_fn(model, dist, range, psill, nugget = 0, kappa = 0.5, ...) +} +\arguments{ +\item{model}{gstat model type. Currenty implemented: "Exp", "Sph", "Cir", "Gau", "Mat", "Bes", "Ste"} + +\item{dist}{Distance (h)} + +\item{range}{Range parameter of the variogram model.} + +\item{psill}{Partial sill of the variogram model.} + +\item{nugget}{Nugget parameter of the variogram model (default = 0)} + +\item{kappa}{Kappa parameter for Matern class variogram models (default = 0.5)} +} +\description{ +R implementation of gstat variogram functions. +} diff --git a/2022_cold_pool_index.Rmd b/plots/2022/2022_cold_pool_index.Rmd similarity index 100% rename from 2022_cold_pool_index.Rmd rename to plots/2022/2022_cold_pool_index.Rmd diff --git a/2022_cold_pool_index.docx b/plots/2022/2022_cold_pool_index.docx similarity index 100% rename from 2022_cold_pool_index.docx rename to plots/2022/2022_cold_pool_index.docx diff --git a/plots/2023_anomaly.png b/plots/2023/2023_anomaly.png similarity index 100% rename from plots/2023_anomaly.png rename to plots/2023/2023_anomaly.png diff --git a/plots/2023_average_temperature.png b/plots/2023/2023_average_temperature.png similarity index 100% rename from plots/2023_average_temperature.png rename to plots/2023/2023_average_temperature.png diff --git a/2023_cold_pool_index.Rmd b/plots/2023/2023_cold_pool_index.Rmd similarity index 100% rename from 2023_cold_pool_index.Rmd rename to plots/2023/2023_cold_pool_index.Rmd diff --git a/plots/2023_cold_pool_index.png b/plots/2023/2023_cold_pool_index.png similarity index 100% rename from plots/2023_cold_pool_index.png rename to plots/2023/2023_cold_pool_index.png diff --git a/plots/2023_coldpool.png b/plots/2023/2023_coldpool.png similarity index 100% rename from plots/2023_coldpool.png rename to plots/2023/2023_coldpool.png diff --git a/plots/2023_coldpool_with_area.png b/plots/2023/2023_coldpool_with_area.png similarity index 100% rename from plots/2023_coldpool_with_area.png rename to plots/2023/2023_coldpool_with_area.png diff --git a/plots/2023_nbs_ebs_sst_map_grid.png b/plots/2023/2023_nbs_ebs_sst_map_grid.png similarity index 100% rename from plots/2023_nbs_ebs_sst_map_grid.png rename to plots/2023/2023_nbs_ebs_sst_map_grid.png diff --git a/plots/2023_nbs_ebs_temperature_map.png b/plots/2023/2023_nbs_ebs_temperature_map.png similarity index 100% rename from plots/2023_nbs_ebs_temperature_map.png rename to plots/2023/2023_nbs_ebs_temperature_map.png diff --git a/plots/2023_nbs_ebs_temperature_map_grid.png b/plots/2023/2023_nbs_ebs_temperature_map_grid.png similarity index 100% rename from plots/2023_nbs_ebs_temperature_map_grid.png rename to plots/2023/2023_nbs_ebs_temperature_map_grid.png diff --git a/plots/2023_plot_sebs_average_temperature.png b/plots/2023/2023_plot_sebs_average_temperature.png similarity index 100% rename from plots/2023_plot_sebs_average_temperature.png rename to plots/2023/2023_plot_sebs_average_temperature.png diff --git a/plots/2023_stacked_temperature.png b/plots/2023/2023_stacked_temperature.png similarity index 100% rename from plots/2023_stacked_temperature.png rename to plots/2023/2023_stacked_temperature.png diff --git a/plots/2023_stacked_temperature_simple_label.png b/plots/2023/2023_stacked_temperature_simple_label.png similarity index 100% rename from plots/2023_stacked_temperature_simple_label.png rename to plots/2023/2023_stacked_temperature_simple_label.png diff --git a/plots/2024_average_temperature.png b/plots/2024_average_temperature.png new file mode 100644 index 0000000..3a59d8b Binary files /dev/null and b/plots/2024_average_temperature.png differ diff --git a/plots/2024_cold_pool_index.png b/plots/2024_cold_pool_index.png new file mode 100644 index 0000000..053000d Binary files /dev/null and b/plots/2024_cold_pool_index.png differ diff --git a/plots/2024_coldpool.png b/plots/2024_coldpool.png new file mode 100644 index 0000000..4c0f3d2 Binary files /dev/null and b/plots/2024_coldpool.png differ diff --git a/plots/2024_coldpool_with_area.png b/plots/2024_coldpool_with_area.png new file mode 100644 index 0000000..92cc9ed Binary files /dev/null and b/plots/2024_coldpool_with_area.png differ diff --git a/plots/2024_nbs_ebs_sst_map_grid.png b/plots/2024_nbs_ebs_sst_map_grid.png new file mode 100644 index 0000000..097b89a Binary files /dev/null and b/plots/2024_nbs_ebs_sst_map_grid.png differ diff --git a/plots/2024_nbs_ebs_temperature_map_grid.png b/plots/2024_nbs_ebs_temperature_map_grid.png new file mode 100644 index 0000000..e3dc743 Binary files /dev/null and b/plots/2024_nbs_ebs_temperature_map_grid.png differ diff --git a/plots/2024_plot_sebs_average_temperature.png b/plots/2024_plot_sebs_average_temperature.png new file mode 100644 index 0000000..3f2eba1 Binary files /dev/null and b/plots/2024_plot_sebs_average_temperature.png differ diff --git a/plots/2024_stacked_temperature.png b/plots/2024_stacked_temperature.png new file mode 100644 index 0000000..97fe218 Binary files /dev/null and b/plots/2024_stacked_temperature.png differ diff --git a/plots/2024_stacked_temperature_simple_label.png b/plots/2024_stacked_temperature_simple_label.png new file mode 100644 index 0000000..a2d332f Binary files /dev/null and b/plots/2024_stacked_temperature_simple_label.png differ