From 942f3375472ad37b812880fbfee7dc51100b2ad4 Mon Sep 17 00:00:00 2001 From: Glenda Date: Fri, 24 May 2024 17:38:53 -0600 Subject: [PATCH] Add new nest data [minor] (#121) * Add new nest data [minor] * Start Mayfield calculations [no version bump] --- .../{old_nest_checks.R => add_new_nests.R} | 24 +- DataCleaningScripts/clean_nest_checks.R | 184 +- DataCleaningScripts/mayfield.R | 226 + Nesting/nest_checks.csv | 19380 ++++++++++++++++ SiteandMethods/species_list.csv | 32 +- testthat/test-nests.R | 7 + 6 files changed, 19668 insertions(+), 185 deletions(-) rename DataCleaningScripts/{old_nest_checks.R => add_new_nests.R} (91%) create mode 100644 DataCleaningScripts/mayfield.R diff --git a/DataCleaningScripts/old_nest_checks.R b/DataCleaningScripts/add_new_nests.R similarity index 91% rename from DataCleaningScripts/old_nest_checks.R rename to DataCleaningScripts/add_new_nests.R index 8c6f135..5a3a60c 100644 --- a/DataCleaningScripts/old_nest_checks.R +++ b/DataCleaningScripts/add_new_nests.R @@ -1,3 +1,25 @@ +# Clean and append new nest check data + +source('DataCleaningScripts/clean_nest_checks.R') +colonies <- read.csv("SiteandMethods/colonies.csv") +species <- read.csv("SiteandMethods/species_list.csv") +nest_checks <- read.csv("Nesting/nest_checks.csv") + +filepath <- "~/Dropbox (UFL)/Everglades/2023 Data/nest_check_data_2023.xlsx" + +year <- 2023 + +newdata <- clean_nest_data(filepath, year) + +all(lubridate::year(newdata$date)==year) +print(unique(newdata$colony[which(!(newdata$colony %in% colonies$colony))])) +print(unique(newdata$species[which(!(newdata$species %in% species$species))])) +all(colnames(newdata)==colnames(nest_checks)) + +write.table(newdata, "Nesting/nest_checks.csv", row.names = FALSE, col.names = FALSE, + append = TRUE, na = "", sep = ",", quote = 9) + + ## Used to clean nest check data 1994 - 2020 into standard long format ## Done one year at a time chronologically, errors get more complicated over time... ## G. Yenni 2020-08 @@ -175,7 +197,7 @@ nests <- nests %>% write.table(nests, "Nesting/nest_checks.csv", row.names = FALSE, na = "", sep = ",", quote = 9) species <- species %>% dplyr::arrange(species) -write.table(species, "SiteandMethods/species_list.csv", row.names = FALSE, na = "", sep = ",", quote = 5:25) +write.table(species, "SiteandMethods/species_list.csv", row.names = FALSE, na = "", sep = ",", quote = 7:27) colonies <- colonies %>% dplyr::arrange(colony) write.table(colonies, "SiteandMethods/colonies.csv", row.names = FALSE, col.names = TRUE, diff --git a/DataCleaningScripts/clean_nest_checks.R b/DataCleaningScripts/clean_nest_checks.R index ac116b5..0dc5196 100644 --- a/DataCleaningScripts/clean_nest_checks.R +++ b/DataCleaningScripts/clean_nest_checks.R @@ -3,10 +3,7 @@ `%>%` <- magrittr::`%>%` -#' Functions customized to old nest data (pre-2020) -#' - -#' Reshapes and cleans nest check data (1994-2005, 2013-2019) +#' Reshapes and cleans nest check data #' #' #' @@ -23,34 +20,30 @@ all_data <- setNames(data.frame(matrix(ncol = 9, nrow = 0)), c("year", "colony", tab_names <- readxl::excel_sheets(path = data_path) tab_names <- tab_names[tab_names != "key"] +tab_names <- tab_names[tab_names != "Proofing"] +tab_names <- tab_names[tab_names != "Template"] +tab_names <- tab_names[tab_names != "template"] tab_names <- tab_names[!startsWith(tab_names ,"Other")] +tab_names <- tab_names[!startsWith(tab_names ,"Sheet")] tab_names <- tab_names[!startsWith(tab_names ,"Overview")] tab_names <- tab_names[!startsWith(tab_names ,"Dataset Headers")] data_raw <- lapply(tab_names, function(x) readxl::read_excel(path = data_path, sheet = x, col_names = FALSE)) for(i in 1:length(tab_names)) { - colnames1 <- as.character(data_raw[[i]][1,]) - colnames1[1:2] <- c("nest", "species") + colnames1 <- as.numeric(data_raw[[i]][1,]) + colnames1[1:3] <- c("colony", "nest", "species") colnames1 <- zoo::na.locf(colnames1) colnames2 <- as.character(data_raw[[i]][2,]) colnames2 <- colnames2[!is.na(colnames2)] colnames2 <- colnames2[colnames2 != "NA"] colnames2 <- colnames2[!is.na(colnames2)] colnames2 <- tolower(gsub("# ","", colnames2)) + if(any(startsWith(colnames2,"comment"))) {colnames2 <- colnames2[1:which(startsWith(colnames2,"comment"))]} colnames1 <- tolower(colnames1[1:length(colnames2)]) colnames <- paste(colnames1, colnames2, sep = "_") - colnames[1:2] <- c("nest", "species") + colnames[1:3] <- c("colony", "nest", "species") colnames[length(colnames)] <- "notes" - #names(data_raw[[i]]) <- colnames - - new_data_colony <- tolower(tab_names[i]) %>% - gsub(" ", "_", .) %>% - gsub("/.", "_", .) %>% - gsub("\\.", "_", .) %>% - gsub("-", "_", .) %>% - gsub("_colony$","",.) %>% - gsub("_$","",.) new_data <- as.data.frame(data_raw[[i]][,1:length(colnames)]) %>% setNames(colnames) %>% @@ -60,17 +53,8 @@ for(i in 1:length(tab_names)) { names_pattern = "(.*)_(.*)", values_to = "count") %>% dplyr::mutate(date = as.Date(as.integer(date), origin="1899-12-30"), - colony = new_data_colony, - colony = replace(colony, colony %in% - c("tam_west", "tamw2015","tamw","tamiami_west_(whib)", - "tamiami_west_(new_trail)","tam_west_ibis_trail", - "tamiami_west_east_side", "tamiami_west_west_side"), "tamiami_west"), - colony = replace(colony, colony=="6th_bridge_whib", "6th_bridge"), - colony = replace(colony, colony %in% c("alley_north_(trail_1)","alley_north_(trail_2)", - "alley_north_west_side","alley_north_south", "an2015"), - "alley_north"), - colony = replace(colony, colony %in% c("big_pond_north_east"), "big_pond"), - colony = replace(colony, colony=="mud_canal_colony", "mud_canal"), + colony = tolower(colony), + year = year, colony = replace(colony, colony=="paurotis_pond", "paurotis"), colony = replace(colony, colony=="jarrod", "jerrod"), colony = replace(colony, colony=="cypresscity", "cypress_city"), @@ -79,148 +63,19 @@ for(i in 1:length(tab_names)) { "horus_(l67)"), "horus"), species = tolower(species), type = tolower(type), - type = replace(type, type=="comments", "notes"), - year = year, - species = replace(species, species %in% c("tric","tche","trhe?"), "trhe"), species = replace(species, species %in% c("?", "-","ge/nh?","ge/nh","unknown"), "unkn"), species = replace(species, is.na(species), "unkn"), species = replace(species, species %in% - c("smwh", "smwt (prob greg)","smwht","greg/smwh","swhe","smwh*"), - "smwt"), + c("smwt", "smwt (prob greg)","smwht","greg/smwh","swhe","smwh*"), + "smwh"), species = replace(species, species %in% c("small heron/cormorant","small heron","sh","sh/an","smda", - "smhe*","bcnh or smhe"), "smhe"), - species = replace(species, species %in% c("an","anhg","anhi?",""), "anhi"), - species = replace(species, species %in% c("gi","gi?","smhe/glib"), "glib"), - species = replace(species, species %in% c("gb","gb (poss. ge)","gbhe?"), "gbhe"), - species = replace(species, species %in% c("whib?","wi", "whip","whib*"), "whib"), - species = replace(species, species %in% c("ge","greg?","greg/smhe?","greg/gbhe"), "greg"), - species = replace(species, species=="green heron", "grhe"), - species = replace(species, species %in% c("sneg?"), "sneg"), - species = replace(species, species %in% - c("smhe/greg/bcnh","smhe/bcnh","trhe/bcnh","trhe/bcnh?"), "bcnh"), - species = replace(species, species %in% c("whib/rospb","rops/greg"), "rosp")) %>% + "smhe*","bcnh or smhe"), "smhe")) %>% dplyr::filter(!is.na(nest), !(type == "notes" & is.na(count))) %>% tidyr::pivot_wider(names_from = type, values_from = count) %>% dplyr::mutate(eggs = tolower(eggs), - chicks = tolower(chicks), - stage = dplyr::case_when(chicks %in% - c("nest gone","gone","flag pulled","empty,pulled","empty/ pulled","pulled","x", - "pulled flag","empty","fp","0/fp","0/ fp","empty/fp","-", - "c(\"x\", \"x\")","c(\"x\", \"0\")","c(\"x\", na)","c(\"0\", \"0\")","?", - "fledged","nnest gone","1dc","*") ~ "empty", - chicks %in% c("fail","failed") ~ "failed", - eggs %in% c("1 broken egg", "fail", "failed", "1 dead") ~ "failed", - eggs %in% c("nest gone","gone","flag pulled","empty, pulled","empty/ pulled", - "pulled","x","pulled flag","empty","emty/pulled","empty/pulled","fp", - "0/fp","destroyed","0/ fp","fallen down","empty/fp","-", - "had been pulled","c(\"x\", na)","c(\"x\", \"x\")","c(\"x\", \"2\")", - "c(\"0\", \"0\")","ir","80", "yes","?","nnest gone", "na","fallen") - ~ "empty", - eggs %in% c("fledged pulled", "fledged","fledge") ~ "fledged"), - chicks = replace(chicks, chicks %in% c("5(+1 dead chick on ground)"), 5), - chicks = replace(chicks, chicks %in% c("4(certain)","4*","8 total w/145", - "8 total w/143","4(+1 dead chick on ground)","c(\"4\", \"0\")","4 (1 wet)"), 4), - chicks = replace(chicks, chicks %in% c("3/fp","2-3","33","c(\"3\", na)", - "c(\"3\", \"3\")","3+","3 (1 wet)","c(\"3 (1 wet)\", \"2 (1 wet)\")","3(+1dead)", - "3(certain)","3 (in area)","3(2wet)","3(confirmed)","3 (double checked it is 3)", - "3 (1 wet)","4+","10 total w/ 128,130","10 total w 128, 126","10 total w/ 126, 130", - "3 (totally sure it is 3 and they cannot be from any other nest around)", - "3 (9 total 126/128/130)","(3 in area)","**","***","****","c(\"3\", \"0\")", - "3*","3 (1 week old)","3c/pulled","3(few days old)","3 (1 dead?)","3(1 wet)", - "3(sneg)","3(in canopy)","3 (very large","3 fledged","3 (1 hatch)","3(1 flew 10ft)", - "3(2 flying)","c(\"3\", \"-\")","c(\"3\", \"missed\")","3(4th on ground dead)", - "3(4th dead chick)","3(2 flew away)","3 ( 1 wet)"), 3), - chicks = replace(chicks, chicks %in% c("2?","2+","2 (sneg on ground)","2 (+1dead)", - "2 fledged","2 (both wet)","2 (1 wet)","2 (+1 dead)","2 (+1 long dead)","2 (2 wet)", - "2 greg +1 bcnh","c(\"2\", na)","2 (1wet)","2(+1 dead)","2(2wet)","2 (certain)", - "2 (big above nest)","2 (flew)","2 (around nest)","2 (2-3 days old)","2 or 3", - "c(\"2\", \"0\")","c(\"2\", \"1\")","2, pulled","2 ( 1 wet)","2 (wet?)","2(1 wet)", - "2*","2 (1 dead)","2+ in canopy","2+ (fledged)","2(in canopy)","2(fledged)", - "2 large","2(certain)","c(\"2\", \"missed\")","4total with 870","4total with 872", - "2(+3rd dead chick)","4 chicks shared","641 & 864","2(fledged in tree)","2 (pulled)"), 2), - chicks = replace(chicks, chicks %in% c("1alive,1dead","1?","1+","1 (wet)","1*","1(2)", - "1 fledged","note","1 (+1dead)","(1 long dead)","1(wet)","1 (1 wet)","1(+1 dead)", - "1 (+1 dead)","1(+1dead)","1(live) 1(dead)","1(ran)","1(dead) 1(alive)","1+ (+ 1 dead)", - "1+(flew out)","c(\"1\", \"1\")","c(\"1\", \"0\")","1(tiny)","1 (branchling)", - "1(hatching)","1c (dead)","(1 live) (1 dead)","1 (in tree)","1(in canopy)", - "1 (fledged)","1(ran away)","1+(in canopy)","1 (looks abandoned)","2 between 3 nests", - "1(certain)","c(\"1\", na)","c(\"1 (+1 dead)\", \"missed\")","1(dying, +1 dead chick)", - "1(flew away)","1 (+1 dead chick)","1(2nd dead chick)","1(+1 dead chick)","1(+2 dead)", - "1+ (pulled)"), 1), - chicks = replace(chicks, chicks %in% c("nest gone","gone","flag pulled","empty,pulled", - "empty/ pulled","pulled","x","pulled flag","empty","fp","0/fp","0/ fp","empty/fp","-", - "fail","failed","c(\"x\", \"x\")","c(\"x\", \"0\")","c(\"x\", na)","c(\"0\", \"0\")", - "?","fledged","nnest gone","1dc","*","1 dead chick","0pulled","chick dead","1dead", - "c(\"0\", na)","c","cormorants here","collpapsed", "collpased","collapsed", - "collapsed pulled","e","empty pulled","collpased pulled","fledged?", - "empty collapsed pulled","empty/pulled","empty collpased","collapsed/pulled","mt", - "mt*","c(\"mt\", na)","mt (1 dead big)","mt pull","mt pulled","mt (2 chick in area)", - "(1dead)","dead(1)","(1 dead)","(2 dead)","1(dead)","predated","dead chick on ground", - "mt (1 big chick in area)","0 (pulled)","pull","mt (1 dead)","mt(1+ in area)", - "mt collapsed","mt (predated)","mt (1 dead c)","(1dead chick)","mt (pulled)", - "on ground","fledge?","c(na, \"empty\")","likely fledged","empty; pulled","fledge/pulled", - "fledged; pulled","0, flag gone","fledged, pulled","nest fell","gone, pulled", - "empty, pulled","empty, flag pulled","no birds, flag pulled, 1 bird in area", - "gone; pulled","gone/pulled","mt/pulled","mt?","235 & 237","mt/gone","mt(2 dead)", - "nest on ground","flag on ground","gone, flag pulled","2 dead chicks","1 (dead)", - "2 dead","mt(1 dead)","c(\"mt\", \"missed\")","1 dead","mt(nest fallen)", - "mt(1 dead chick)"), 0), - chicks = replace(chicks, chicks %in% - c("no data","comment","lost flag","not checked","flag gone","c(na, na)", "not found", - "missed","c(\"not checked\", \"not checked\")","missd","missed or couldn't get to?", - "missing","missed in the notebook says wost not greg","miss","missed, likely mt", - "missed?","na","n/a","c(\"n/a\", \"n/a\")","couldn't find", - "flag pulled, gone","flag not found","missed, no record","missed*"), NA), - eggs = replace(eggs, eggs %in% c("5 (2 pipping)"), 5), - eggs = replace(eggs, eggs %in% c("4 (1pipping)","4 (1p)","4(dead)","4 (1 pipping)", - "(4 anhi) pulled","c(\"4\", \"4\")","4 (greg)","4 (1 pip)","4 ( 1 pip)","4 (1 hatch)" - ), 4), - eggs = replace(eggs, eggs %in% c("c(\"3\", na)","3(1 pipping)","3 (1 pipping)", - "3 (2 pipping)","3 (1p)","c(\"3\", \"3\")","3(whib)","3(broken)","3(2 pipping)", - "3(1p)","3(pipping)","3 (1pip)","3 (1 pip)","3(pip)","3(glib)","3 (2 pip)", - "3 ( 1pip)","c(\"3\", \"-\")","3(1 pip)" ), 3), - eggs = replace(eggs, eggs %in% c("smhe(2 eggs)","2 (1p)","2(1 pipping)","2(renest)", - "2 (1 pipping)","2(broken)","2*","2 (1pipping)","2(pipping)","2(predated)", - "2 (pipping)","2 (anhi)","2 (wost)","c(\"2\", \"2\")","c(\"1\", \"2\")", - "3-4 branchlings b/t 8 and 10","2 (1 pip)","2 (1 hatching)","2(dead)","2 (glib)", - "2(glib)","2(trhe)","2 (1pip)","2 (dead)","c(\"2\", \"-\")","4 chicks between 844 & 846", - "7 chicks between 840, 830, 832","4 chicks between 641 & 864", - "5 chicks between 718 & 720"), 2), - eggs = replace(eggs, eggs %in% c("1 broken egg","1?","1 (old)","1 (1pipping)","1(1p)", - "1 (pippng)","(1 broken or pipping)","1( pipping)","1 old egg","(dead) 1","(dead)1", - "1(pipping)","1+","1(dead)","1 (dead)","1 (+1cracked)","(1 broken)","1(broken)", - "1 (pulled)","1 (pipping)","1 (dead, old)","1 (1p)","1 (cold)","c(\"1\", \"1\")", - "c(\"0\", \"1\")","1 (pip)","1 chick, either 18 or 77","1 + 1","1 (1 pip)", - "1(pip)","1(glib)","1 dead egg","1 (glib)","4 chicks between 366, 368, 370", - "3 chicks between 810, 812, 814","3 chicks between 824 & 826", - "2 chicks between 824 & 826","1*","2 chicks between 142 & 140"), 1), - eggs = replace(eggs, eggs %in% - c("nest gone","gone","flag pulled","empty, pulled","empty/ pulled","pulled","x", - "pulled flag","empty","emty/pulled","empty/pulled","fp","0/fp","destroyed","0/ fp", - "fallen down","empty/fp","-","fail","had been pulled","failed","c(\"x\", na)", - "c(\"x\", \"x\")","c(\"x\", \"2\")","c(\"0\", \"0\")","ir","80","yes","?","fledged", - "nnest gone", "na","fledged pulled","13 chicks for this group","fallen","1 dead", - "predated-grackle","c(\"0\", na)","chicks running","1e-fail","falling","1d", - "gone/pulled","collapsed","collapsed/pulled","gone pulled","drop","gone? or pulled", - "?/pulled","egg shells/pulled","nest gone/pulled","nest collapsed","destroyed-pulled", - "empty*","destroyed/pulled","predated","note","see note","collapsed pulled","mt","m", - "mt pull","mt pulled","collapsed and pulled","predated (1 broken)","*","mt (pulled)", - "pull","126/128/130","0+","collpased","abandoned","on ground", - "*1 nest w/ 3 dead chicks, 1 nest w/ 2 dead chicks","feathers taken","fledge?", - "fledge","no birds, flag pulled, 1 bird in area","gone, pulled","empty, flag pulled", - "gone; pulled","fledged, pulled","nest fell","0, flag gone","fledged; pulled", - "fledge/pulled","empty; pulled","likely fledged","gone, flag pulled", - "flag pulled, gone","mt / pulled","gone/*1","pretty sure nest was empty on 3/10", - "mt (1 egg dead)","mt (1 dead egg)"), 0), - eggs = replace(eggs, eggs %in% c("no data","comment","lost flag","not checked", - "flag gone","c(na, na)","not found","not checkd","flag gone", - "not checked - whib in colony","missed","missed. pulled?", - "n/a see 376a","missed?","no longer on trail","nest missing","no nest","can't find", - "missed pulled","couldn’t check","too high","can't see","miss","n/a", - "c(\"n/a\", \"n/a\")","flagging gone","missed, no record","flag not found","missing", - "c(na, \"empty\")","couldn't find","flag on ground"), NA)) %>% - dplyr::mutate(dplyr::across(everything(),~ purrr:map_chr(.x, ~ gsub("\"", "", .x)))) %>% + chicks = tolower(chicks)) %>% + dplyr::mutate(dplyr::across(everything(),~ purrr::map_chr(.x, ~ gsub("\"", "", .x)))) %>% dplyr::mutate(year = as.integer(year), colony = as.character(colony), nest = as.character(nest), @@ -232,13 +87,6 @@ for(i in 1:length(tab_names)) { notes = as.character(notes)) %>% dplyr::select(year, colony, nest, species, date, eggs, chicks, stage, notes) - if(!all(new_data$colony %in% colonies$colony)| - !all(new_data$species %in% species$species)| - !all(format(as.Date(new_data$date),"%Y")==year)) { - print(unique(new_data$colony[which(!(new_data$colony %in% colonies$colony))])) - print(unique(new_data$species[which(!(new_data$species %in% species$species))])) - } - all_data <- rbind(all_data, new_data) } return(all_data) diff --git a/DataCleaningScripts/mayfield.R b/DataCleaningScripts/mayfield.R new file mode 100644 index 0000000..4b49830 --- /dev/null +++ b/DataCleaningScripts/mayfield.R @@ -0,0 +1,226 @@ +`%>%` <- magrittr::`%>%` +species <- read.csv("SiteandMethods/species_list.csv") + +#' Get nest metrics +#' +nests <- read.csv("Nesting/nest_checks.csv", na.strings = "") %>% + dplyr::filter(year>=2017) %>% + plyr::join(species[,c(1,5,6)], by = "species") %>% + dplyr::mutate(date = lubridate::as_date(date), + eggs = as.integer(eggs), + chicks = as.integer(chicks)) %>% + # make consistent use of stage column + dplyr::mutate(stage = dplyr::case_when((is.na(stage) & eggs %in% c(1:10) & chicks %in% c(1:10)) ~ "hatching", + (is.na(stage) & eggs %in% c(1:10)) ~ "incubating", + (is.na(stage) & chicks %in% c(1:10)) ~ "nestling", + (is.na(stage) & !(eggs %in% c(1:10)) & !(chicks %in% c(1:10))) ~ "empty", + TRUE ~ stage)) %>% + dplyr::mutate(start_date = dplyr::case_when(stage == "incubating" ~ date-1, + stage == "pipping" ~ date - incubation_j, + stage == "hatching" ~ date - incubation_j, + stage == "wet_chick" ~ date - incubation_j, + stage == "chick_dry" ~ date - incubation_j - 1, + stage == "nestling" ~ date - incubation_j - 2, + TRUE ~ NA), + incubation_end = dplyr::case_when(stage == "pipping" ~ date, + stage == "hatching" ~ date, + stage == "wet_chick" ~ date, + stage == "chick_dry" ~ date-1, + stage == "nestling" ~ date-2, + stage == "fledged" ~ date-nestling_j, + stage == "branchling" ~ date-nestling_j-2, + TRUE ~ NA)) +nest_success <- nests %>% + dplyr::rename(nest_number = nest) %>% + dplyr::group_by(year,colony,nest_number,species) %>% + dplyr::summarise(clutch = max(eggs, na.rm = TRUE), + brood = max(chicks, na.rm = TRUE), + brood = dplyr::case_when(!is.finite(brood) ~ NA, + TRUE ~ brood), + clutch = dplyr::case_when(!is.finite(clutch) ~ brood, + clutch% + dplyr::filter(year>=2017) %>% + plyr::join(species[,c(1,5,6)], by = "species") %>% + # make consistent use of success columns + dplyr::mutate(incubation_success = dplyr::case_when(is.na(incubation_success) & brood %in% c(1:10) ~ 1, + is.na(incubation_success) & fledged %in% c(1:10) ~ 1, + TRUE ~ incubation_success), + nestling_success = dplyr::case_when(is.na(nestling_success) & fledged %in% c(1:10) ~ 1, + TRUE ~ nestling_success)) %>% + dplyr::group_by(year,colony,species) %>% + dplyr::summarise(incubation_k=sum(!is.na(nest_number)), + incubation_sumy=sum(incubation_success==1, na.rm=TRUE), + incubation_e=sum(n_days_incubation, na.rm = TRUE), + incubation_j=mean(incubation_j, na.rm = TRUE), + nestling_k=sum(incubation_success==1, na.rm=TRUE), + nestling_sumy=sum(nestling_success==1, na.rm=TRUE), + nestling_e=sum(n_days_nestling, na.rm = TRUE), + nestling_j=mean(nestling_j, na.rm = TRUE)) %>% + dplyr::mutate(incubation_p = 1-((incubation_k-incubation_sumy)/incubation_e), + incubation_pj = incubation_p^incubation_j, + incubation_varp=(incubation_p*(1-incubation_p))/incubation_e, + incubation_varpj = incubation_varp*((incubation_j*(incubation_p^(incubation_j-1)))^2), + incubation_sdpj = sqrt(incubation_varpj), + nestling_p = 1-((nestling_k-nestling_sumy)/nestling_e), + nestling_pj = nestling_p^nestling_j, + nestling_varp=(nestling_p*(1-nestling_p))/nestling_e, + nestling_varpj = nestling_varp*((nestling_j*(nestling_p^(nestling_j-1)))^2), + nestling_sdpj = sqrt(nestling_varpj), + overall_p = (incubation_p^incubation_j)*(nestling_p^nestling_j), + overall_varp = ((incubation_pj^2)*nestling_varpj)+((nestling_pj^2)*incubation_varpj)+(incubation_varpj*nestling_varpj), + overall_sd = sqrt(overall_varp)) + +compare <- dplyr::left_join(success,success_summary, by=dplyr::join_by(year, colony, species)) %>% + dplyr::filter(species %in% c("bcnh","gbhe","glib","greg","rosp","smhe","sneg","whib","wost")) + +library(ggplot2) +library(ggpubr) +# Compare basics +a <- ggplot(compare, aes(x=incubation_k.x, y=incubation_k.y)) + + geom_point(aes(color=species)) + + geom_abline(slope = 1, intercept = 0) + + annotate(geom="text", x=20, y=150, color="red", + label=paste("Missing:",sum(is.na(compare$incubation_k.y)))) + + xlab("Raw Incubation K") + + ylab("Reported Incubation K") + + theme_minimal() + +b <- ggplot(compare, aes(x=nestling_k.x, y=nestling_k.y)) + + geom_point(aes(color=species)) + + geom_abline(slope = 1, intercept = 0) + + annotate(geom="text", x=20, y=110, color="red", + label=paste("Missing:",sum(is.na(compare$nestling_k.y)))) + + xlab("Raw Nestling K") + + ylab("Reported Nestling K") + + theme_minimal() + +c <- ggplot(compare, aes(x=incubation_sumy.x, y=incubation_sumy.y)) + + geom_point(aes(color=species)) + + geom_abline(slope = 1, intercept = 0) + + annotate(geom="text", x=20, y=100, color="red", + label=paste("Missing:",sum(is.na(compare$incubation_sumy.y)))) + + xlab("Raw Incubation SumY") + + ylab("Reported Incubation SumY") + + theme_minimal() + +d <- ggplot(compare, aes(x=nestling_sumy.x, y=nestling_sumy.y)) + + geom_point(aes(color=species)) + + geom_abline(slope = 1, intercept = 0) + + annotate(geom="text", x=20, y=100, color="red", + label=paste("Missing:",sum(is.na(compare$nestling_sumy.y)))) + + xlab("Raw Nestling_SumY") + + ylab("Reported Nestling SumY") + + theme_minimal() + +e <- ggplot(compare, aes(x=incubation_e.x, y=incubation_e.y)) + + geom_point(aes(color=species)) + + geom_abline(slope = 1, intercept = 0) + + annotate(geom="text", x=2500, y=2500, color="red", + label=paste("Missing:",sum(is.na(compare$incubation_e.y)))) + + xlab("Raw Incubation E") + + ylab("Reported Incubation E") + + theme_minimal() + +f <- ggplot(compare, aes(x=nestling_e.x, y=nestling_e.y)) + + geom_point(aes(color=species)) + + geom_abline(slope = 1, intercept = 0) + + annotate(geom="text", x=500, y=3500, color="red", + label=paste("Missing:",sum(is.na(compare$nestling_e.y)))) + + xlab("Raw Nestling E") + + ylab("Reported Nestling E") + + theme_minimal() + +g <- ggplot(compare, aes(x=incubation_j.x, y=incubation_j.y)) + + geom_jitter(aes(color=species)) + + geom_abline(slope = 1, intercept = 0) + + annotate(geom="text", x=22, y=28, color="red", + label=paste("Missing:",sum(is.na(compare$incubation_j.y)))) + + xlab("Raw Incubation j") + + ylab("Reported Incubation j") + + theme_minimal() + +h <- ggplot(compare, aes(x=nestling_j.x, y=nestling_j.y)) + + geom_jitter(aes(color=species)) + + geom_abline(slope = 1, intercept = 0) + + annotate(geom="text", x=20, y=50, color="red", + label=paste("Missing:",sum(is.na(compare$nestling_j.y)))) + + xlab("Raw Nestling j") + + ylab("Reported Nestling j") + + theme_minimal() + +ggarrange(a, b, c, d, e, f, g, h, ncol = 4, nrow = 2, common.legend = TRUE) + +# Compare calculations +u <- ggplot(compare, aes(x=incubation_pj.x, y=incubation_pj.y)) + + geom_point(aes(color=species)) + + geom_abline(slope = 1, intercept = 0) + + xlab("Raw Incubation pj") + + ylab("Reported Incubation pj") + + theme_minimal() + +v <- ggplot(compare, aes(x=nestling_pj.x, y=nestling_pj.y)) + + geom_point(aes(color=species)) + + geom_abline(slope = 1, intercept = 0) + + xlab("Raw Nestling pj") + + ylab("Reported Nestling pj") + + theme_minimal() + +w <- ggplot(compare, aes(x=incubation_p.x, y=incubation_p.y)) + + geom_point(aes(color=species)) + + geom_abline(slope = 1, intercept = 0) + + xlim(0,1) + + ylim(0,1) + + xlab("Raw Incubation p") + + ylab("Reported Incubation p") + + theme_minimal() + +x <- ggplot(compare, aes(x=nestling_p.x, y=nestling_p.y)) + + geom_point(aes(color=species)) + + geom_abline(slope = 1, intercept = 0) + + xlim(0,1) + + ylim(0,1) + + xlab("Raw Nestling p") + + ylab("Reported Nestling p") + + theme_minimal() + +y <- ggplot(compare, aes(x=overall_p.x, y=overall_p.y)) + + geom_point(aes(color=species)) + + geom_abline(slope = 1, intercept = 0) + + xlab("Raw Overall p") + + ylab("Reported Overall p") + + theme_minimal() + +z <- ggplot(compare, aes(x=overall_varp.x, y=overall_varp.y)) + + geom_point(aes(color=species)) + + geom_abline(slope = 1, intercept = 0) + + xlab("Raw Overall Variance") + + ylab("Reported Overall Variance") + + theme_minimal() + +ggarrange(u, v, w, x, y, z, ncol = 3, nrow = 2, common.legend = TRUE) diff --git a/Nesting/nest_checks.csv b/Nesting/nest_checks.csv index 1a3a426..a3c4b69 100644 --- a/Nesting/nest_checks.csv +++ b/Nesting/nest_checks.csv @@ -51385,3 +51385,19383 @@ 2020,tamiami_west,872,wost,2020-05-30,,,, 2020,tamiami_west,872,wost,2020-06-05,,0,, 2020,tamiami_west,872,wost,2020-06-12,,,, +2021,henry,1,greg,2021-02-09,2,,incubating,"4/19 large dead fledgling found below nest, though at least one other high up, unmarked nest is nearby with similar aged chicks" +2021,henry,1,greg,2021-02-15,3,,incubating,"4/19 large dead fledgling found below nest, though at least one other high up, unmarked nest is nearby with similar aged chicks" +2021,henry,1,greg,2021-02-22,3,,incubating,"4/19 large dead fledgling found below nest, though at least one other high up, unmarked nest is nearby with similar aged chicks" +2021,henry,1,greg,2021-03-01,3,,incubating,"4/19 large dead fledgling found below nest, though at least one other high up, unmarked nest is nearby with similar aged chicks" +2021,henry,1,greg,2021-03-08,,3,nestling,"4/19 large dead fledgling found below nest, though at least one other high up, unmarked nest is nearby with similar aged chicks" +2021,henry,1,greg,2021-03-15,,2,nestling,"4/19 large dead fledgling found below nest, though at least one other high up, unmarked nest is nearby with similar aged chicks" +2021,henry,1,greg,2021-03-22,,2,nestling,"4/19 large dead fledgling found below nest, though at least one other high up, unmarked nest is nearby with similar aged chicks" +2021,henry,1,greg,2021-03-29,,3,nestling,"4/19 large dead fledgling found below nest, though at least one other high up, unmarked nest is nearby with similar aged chicks" +2021,henry,1,greg,2021-04-05,,3,nestling,"4/19 large dead fledgling found below nest, though at least one other high up, unmarked nest is nearby with similar aged chicks" +2021,henry,1,greg,2021-04-13,,0,fledged,"4/19 large dead fledgling found below nest, though at least one other high up, unmarked nest is nearby with similar aged chicks" +2021,henry,1,greg,2021-04-19,,,,"4/19 large dead fledgling found below nest, though at least one other high up, unmarked nest is nearby with similar aged chicks" +2021,henry,1,greg,2021-04-26,,,,"4/19 large dead fledgling found below nest, though at least one other high up, unmarked nest is nearby with similar aged chicks" +2021,henry,1,greg,2021-05-03,,,,"4/19 large dead fledgling found below nest, though at least one other high up, unmarked nest is nearby with similar aged chicks" +2021,henry,2,greg,2021-02-09,2,,incubating,"4/5 possibly more than 2 chicks" +2021,henry,2,greg,2021-02-15,2,,incubating,"4/5 possibly more than 2 chicks" +2021,henry,2,greg,2021-02-22,3,,incubating,"4/5 possibly more than 2 chicks" +2021,henry,2,greg,2021-03-01,3,,incubating,"4/5 possibly more than 2 chicks" +2021,henry,2,greg,2021-03-08,1,2,hatching,"4/5 possibly more than 2 chicks" +2021,henry,2,greg,2021-03-15,,2,nestling,"4/5 possibly more than 2 chicks" +2021,henry,2,greg,2021-03-22,,3,nestling,"4/5 possibly more than 2 chicks" +2021,henry,2,greg,2021-03-29,,3,nestling,"4/5 possibly more than 2 chicks" +2021,henry,2,greg,2021-04-05,,2,nestling,"4/5 possibly more than 2 chicks" +2021,henry,2,greg,2021-04-13,,3,nestling,"4/5 possibly more than 2 chicks" +2021,henry,2,greg,2021-04-19,,0,fledged,"4/5 possibly more than 2 chicks" +2021,henry,2,greg,2021-04-26,,,,"4/5 possibly more than 2 chicks" +2021,henry,2,greg,2021-05-03,,,,"4/5 possibly more than 2 chicks" +2021,henry,3,greg,2021-02-09,3,,incubating,"3/8 collapsed" +2021,henry,3,greg,2021-02-15,3,,incubating,"3/8 collapsed" +2021,henry,3,greg,2021-02-22,0,,empty,"3/8 collapsed" +2021,henry,3,greg,2021-03-01,,,,"3/8 collapsed" +2021,henry,3,greg,2021-03-08,,,,"3/8 collapsed" +2021,henry,3,greg,2021-03-15,,,,"3/8 collapsed" +2021,henry,3,greg,2021-03-22,,,,"3/8 collapsed" +2021,henry,3,greg,2021-03-29,,,,"3/8 collapsed" +2021,henry,3,greg,2021-04-05,,,,"3/8 collapsed" +2021,henry,3,greg,2021-04-13,,,,"3/8 collapsed" +2021,henry,3,greg,2021-04-19,,,,"3/8 collapsed" +2021,henry,3,greg,2021-04-26,,,,"3/8 collapsed" +2021,henry,3,greg,2021-05-03,,,,"3/8 collapsed" +2021,henry,4,greg,2021-02-09,3,,incubating, +2021,henry,4,greg,2021-02-15,4,,incubating, +2021,henry,4,greg,2021-02-22,4,,incubating, +2021,henry,4,greg,2021-03-01,4,,incubating, +2021,henry,4,greg,2021-03-08,2,2,wet_chick, +2021,henry,4,greg,2021-03-15,1,3,hatching, +2021,henry,4,greg,2021-03-22,,3,nestling, +2021,henry,4,greg,2021-03-29,,2,nestling, +2021,henry,4,greg,2021-04-05,,2,nestling, +2021,henry,4,greg,2021-04-13,,1,nestling, +2021,henry,4,greg,2021-04-19,,0,fledged, +2021,henry,4,greg,2021-04-26,,,, +2021,henry,4,greg,2021-05-03,,,, +2021,henry,35,greg,2021-02-09,,,, +2021,henry,35,greg,2021-02-15,4,,incubating, +2021,henry,35,greg,2021-02-22,1,,incubating, +2021,henry,35,greg,2021-03-01,3,,incubating, +2021,henry,35,greg,2021-03-08,3,,incubating, +2021,henry,35,greg,2021-03-15,3,,incubating, +2021,henry,35,greg,2021-03-22,1,2,hatching, +2021,henry,35,greg,2021-03-29,,3,nestling, +2021,henry,35,greg,2021-04-05,,2,nestling, +2021,henry,35,greg,2021-04-13,,2,nestling, +2021,henry,35,greg,2021-04-19,,2,, +2021,henry,35,greg,2021-04-26,,1,fledged, +2021,henry,35,greg,2021-05-03,,,, +2021,henry,5,greg,2021-02-09,1,,incubating,"3/1 collapsed" +2021,henry,5,greg,2021-02-15,4,,incubating,"3/1 collapsed" +2021,henry,5,greg,2021-02-22,0,,empty,"3/1 collapsed" +2021,henry,5,greg,2021-03-01,,,,"3/1 collapsed" +2021,henry,5,greg,2021-03-08,,,,"3/1 collapsed" +2021,henry,5,greg,2021-03-15,,,,"3/1 collapsed" +2021,henry,5,greg,2021-03-22,,,,"3/1 collapsed" +2021,henry,5,greg,2021-03-29,,,,"3/1 collapsed" +2021,henry,5,greg,2021-04-05,,,,"3/1 collapsed" +2021,henry,5,greg,2021-04-13,,,,"3/1 collapsed" +2021,henry,5,greg,2021-04-19,,,,"3/1 collapsed" +2021,henry,5,greg,2021-04-26,,,,"3/1 collapsed" +2021,henry,5,greg,2021-05-03,,,,"3/1 collapsed" +2021,henry,8,greg,2021-02-09,3,,incubating, +2021,henry,8,greg,2021-02-15,3,,incubating, +2021,henry,8,greg,2021-02-22,3,,incubating, +2021,henry,8,greg,2021-03-01,3,,incubating, +2021,henry,8,greg,2021-03-08,,3,nestling, +2021,henry,8,greg,2021-03-15,,3,nestling, +2021,henry,8,greg,2021-03-22,,3,nestling, +2021,henry,8,greg,2021-03-29,,3,nestling, +2021,henry,8,greg,2021-04-05,,2,nestling, +2021,henry,8,greg,2021-04-13,,3,nestling, +2021,henry,8,greg,2021-04-19,,0,fledged, +2021,henry,8,greg,2021-04-26,,,, +2021,henry,8,greg,2021-05-03,,,, +2021,henry,10,greg,2021-02-09,1,,incubating, +2021,henry,10,greg,2021-02-15,2,,incubating, +2021,henry,10,greg,2021-02-22,3,,incubating, +2021,henry,10,greg,2021-03-01,3,,incubating, +2021,henry,10,greg,2021-03-08,3,,, +2021,henry,10,greg,2021-03-15,,2,nestling, +2021,henry,10,greg,2021-03-22,,3,nestling, +2021,henry,10,greg,2021-03-29,,3,nestling, +2021,henry,10,greg,2021-04-05,,2,nestling, +2021,henry,10,greg,2021-04-13,,2,nestling, +2021,henry,10,greg,2021-04-19,,0,fledged, +2021,henry,10,greg,2021-04-26,,,, +2021,henry,10,greg,2021-05-03,,,, +2021,henry,6,greg,2021-02-09,2,,incubating, +2021,henry,6,greg,2021-02-15,2,,incubating, +2021,henry,6,greg,2021-02-22,2,,incubating, +2021,henry,6,greg,2021-03-01,2,,incubating, +2021,henry,6,greg,2021-03-08,,2,nestling, +2021,henry,6,greg,2021-03-15,,2,nestling, +2021,henry,6,greg,2021-03-22,,2,nestling, +2021,henry,6,greg,2021-03-29,,2,nestling, +2021,henry,6,greg,2021-04-05,,2,nestling, +2021,henry,6,greg,2021-04-13,,2,nestling, +2021,henry,6,greg,2021-04-19,,0,fledged, +2021,henry,6,greg,2021-04-26,,,, +2021,henry,6,greg,2021-05-03,,,, +2021,henry,67,greg,2021-02-09,,,,"4/13 probably fledged" +2021,henry,67,greg,2021-02-15,,,,"4/13 probably fledged" +2021,henry,67,greg,2021-02-22,,,,"4/13 probably fledged" +2021,henry,67,greg,2021-03-01,3,,incubating,"4/13 probably fledged" +2021,henry,67,greg,2021-03-08,1,2,hatching,"4/13 probably fledged" +2021,henry,67,greg,2021-03-15,,3,nestling,"4/13 probably fledged" +2021,henry,67,greg,2021-03-22,,,missed,"4/13 probably fledged" +2021,henry,67,greg,2021-03-29,,2,nestling,"4/13 probably fledged" +2021,henry,67,greg,2021-04-05,,1,nestling,"4/13 probably fledged" +2021,henry,67,greg,2021-04-13,,0,empty,"4/13 probably fledged" +2021,henry,67,greg,2021-04-19,,,,"4/13 probably fledged" +2021,henry,67,greg,2021-04-26,,,,"4/13 probably fledged" +2021,henry,67,greg,2021-05-03,,,,"4/13 probably fledged" +2021,henry,11,greg,2021-02-09,1,,incubating,"3/29 checked incorrect nest that had 4 eggs" +2021,henry,11,greg,2021-02-15,3,,incubating,"3/29 checked incorrect nest that had 4 eggs" +2021,henry,11,greg,2021-02-22,3,,incubating,"3/29 checked incorrect nest that had 4 eggs" +2021,henry,11,greg,2021-03-01,3,,incubating,"3/29 checked incorrect nest that had 4 eggs" +2021,henry,11,greg,2021-03-08,1,2,wet_chick,"3/29 checked incorrect nest that had 4 eggs" +2021,henry,11,greg,2021-03-15,,3,nestling,"3/29 checked incorrect nest that had 4 eggs" +2021,henry,11,greg,2021-03-22,,3,nestling,"3/29 checked incorrect nest that had 4 eggs" +2021,henry,11,greg,2021-03-29,,,missed,"3/29 checked incorrect nest that had 4 eggs" +2021,henry,11,greg,2021-04-05,,3,nestling,"3/29 checked incorrect nest that had 4 eggs" +2021,henry,11,greg,2021-04-13,,2,nestling,"3/29 checked incorrect nest that had 4 eggs" +2021,henry,11,greg,2021-04-19,,0,fledged,"3/29 checked incorrect nest that had 4 eggs" +2021,henry,11,greg,2021-04-26,,,,"3/29 checked incorrect nest that had 4 eggs" +2021,henry,11,greg,2021-05-03,,,,"3/29 checked incorrect nest that had 4 eggs" +2021,henry,7,greg,2021-02-09,3,,incubating, +2021,henry,7,greg,2021-02-15,3,,incubating, +2021,henry,7,greg,2021-02-22,3,,incubating, +2021,henry,7,greg,2021-03-01,3,,incubating, +2021,henry,7,greg,2021-03-08,,3,nestling, +2021,henry,7,greg,2021-03-15,,3,nestling, +2021,henry,7,greg,2021-03-22,,3,nestling, +2021,henry,7,greg,2021-03-29,,3,nestling, +2021,henry,7,greg,2021-04-05,,0,fledged, +2021,henry,7,greg,2021-04-13,,,, +2021,henry,7,greg,2021-04-19,,,, +2021,henry,7,greg,2021-04-26,,,, +2021,henry,7,greg,2021-05-03,,,, +2021,henry,48,greg,2021-02-09,,,, +2021,henry,48,greg,2021-02-15,3,,incubating, +2021,henry,48,greg,2021-02-22,4,,incubating, +2021,henry,48,greg,2021-03-01,3,,incubating, +2021,henry,48,greg,2021-03-08,4,,, +2021,henry,48,greg,2021-03-15,,4,nestling, +2021,henry,48,greg,2021-03-22,,4,nestling, +2021,henry,48,greg,2021-03-29,,3,nestling, +2021,henry,48,greg,2021-04-05,,2,nestling, +2021,henry,48,greg,2021-04-13,,0,fledged, +2021,henry,48,greg,2021-04-19,,,, +2021,henry,48,greg,2021-04-26,,,, +2021,henry,48,greg,2021-05-03,,,, +2021,henry,50,greg,2021-02-09,,,,"4/5 dead chick under nest, 4/13 possibly two" +2021,henry,50,greg,2021-02-15,3,,incubating,"4/5 dead chick under nest, 4/13 possibly two" +2021,henry,50,greg,2021-02-22,3,,incubating,"4/5 dead chick under nest, 4/13 possibly two" +2021,henry,50,greg,2021-03-01,3,,incubating,"4/5 dead chick under nest, 4/13 possibly two" +2021,henry,50,greg,2021-03-08,1,2,wet_chick,"4/5 dead chick under nest, 4/13 possibly two" +2021,henry,50,greg,2021-03-15,,3,nestling,"4/5 dead chick under nest, 4/13 possibly two" +2021,henry,50,greg,2021-03-22,,2,nestling,"4/5 dead chick under nest, 4/13 possibly two" +2021,henry,50,greg,2021-03-29,,2,nestling,"4/5 dead chick under nest, 4/13 possibly two" +2021,henry,50,greg,2021-04-05,,1,nestling,"4/5 dead chick under nest, 4/13 possibly two" +2021,henry,50,greg,2021-04-13,,1,nestling,"4/5 dead chick under nest, 4/13 possibly two" +2021,henry,50,greg,2021-04-19,,0,fledged,"4/5 dead chick under nest, 4/13 possibly two" +2021,henry,50,greg,2021-04-26,,,,"4/5 dead chick under nest, 4/13 possibly two" +2021,henry,50,greg,2021-05-03,,,,"4/5 dead chick under nest, 4/13 possibly two" +2021,henry,37,greg,2021-02-09,,,,"4/13 chicks running everywhere so probably more" +2021,henry,37,greg,2021-02-15,3,,incubating,"4/13 chicks running everywhere so probably more" +2021,henry,37,greg,2021-02-22,,,missed,"4/13 chicks running everywhere so probably more" +2021,henry,37,greg,2021-03-01,3,,incubating,"4/13 chicks running everywhere so probably more" +2021,henry,37,greg,2021-03-08,2,1,hatching,"4/13 chicks running everywhere so probably more" +2021,henry,37,greg,2021-03-15,,3,nestling,"4/13 chicks running everywhere so probably more" +2021,henry,37,greg,2021-03-22,,3,nestling,"4/13 chicks running everywhere so probably more" +2021,henry,37,greg,2021-03-29,,3,nestling,"4/13 chicks running everywhere so probably more" +2021,henry,37,greg,2021-04-05,,3,nestling,"4/13 chicks running everywhere so probably more" +2021,henry,37,greg,2021-04-13,,1,nestling,"4/13 chicks running everywhere so probably more" +2021,henry,37,greg,2021-04-19,,0,fledged,"4/13 chicks running everywhere so probably more" +2021,henry,37,greg,2021-04-26,,,,"4/13 chicks running everywhere so probably more" +2021,henry,37,greg,2021-05-03,,,,"4/13 chicks running everywhere so probably more" +2021,henry,39,greg,2021-02-09,,,, +2021,henry,39,greg,2021-02-15,4,,incubating, +2021,henry,39,greg,2021-02-22,,,missed, +2021,henry,39,greg,2021-03-01,4,,incubating, +2021,henry,39,greg,2021-03-08,,3,nestling, +2021,henry,39,greg,2021-03-15,,3,nestling, +2021,henry,39,greg,2021-03-22,,3,nestling, +2021,henry,39,greg,2021-03-29,,3,nestling, +2021,henry,39,greg,2021-04-05,,3,nestling, +2021,henry,39,greg,2021-04-13,,2,nestling, +2021,henry,39,greg,2021-04-19,,0,fledged, +2021,henry,39,greg,2021-04-26,,,, +2021,henry,39,greg,2021-05-03,,,, +2021,henry,41,greg,2021-02-09,,,,"3/22 3 live chicks plus a 4th dead chick present" +2021,henry,41,greg,2021-02-15,3,,incubating,"3/22 3 live chicks plus a 4th dead chick present" +2021,henry,41,greg,2021-02-22,4,,incubating,"3/22 3 live chicks plus a 4th dead chick present" +2021,henry,41,greg,2021-03-01,4,,incubating,"3/22 3 live chicks plus a 4th dead chick present" +2021,henry,41,greg,2021-03-08,4,,incubating,"3/22 3 live chicks plus a 4th dead chick present" +2021,henry,41,greg,2021-03-15,,4,nestling,"3/22 3 live chicks plus a 4th dead chick present" +2021,henry,41,greg,2021-03-22,,3,nestling,"3/22 3 live chicks plus a 4th dead chick present" +2021,henry,41,greg,2021-03-29,,,missed,"3/22 3 live chicks plus a 4th dead chick present" +2021,henry,41,greg,2021-04-05,,2,nestling,"3/22 3 live chicks plus a 4th dead chick present" +2021,henry,41,greg,2021-04-13,,1,nestling,"3/22 3 live chicks plus a 4th dead chick present" +2021,henry,41,greg,2021-04-19,,0,fledged,"3/22 3 live chicks plus a 4th dead chick present" +2021,henry,41,greg,2021-04-26,,,,"3/22 3 live chicks plus a 4th dead chick present" +2021,henry,41,greg,2021-05-03,,,,"3/22 3 live chicks plus a 4th dead chick present" +2021,henry,9,greg,2021-02-09,2,,incubating,"3/1 collapsed" +2021,henry,9,greg,2021-02-15,0,,empty,"3/1 collapsed" +2021,henry,9,greg,2021-02-22,,,,"3/1 collapsed" +2021,henry,9,greg,2021-03-01,,,,"3/1 collapsed" +2021,henry,9,greg,2021-03-08,,,,"3/1 collapsed" +2021,henry,9,greg,2021-03-15,,,,"3/1 collapsed" +2021,henry,9,greg,2021-03-22,,,,"3/1 collapsed" +2021,henry,9,greg,2021-03-29,,,,"3/1 collapsed" +2021,henry,9,greg,2021-04-05,,,,"3/1 collapsed" +2021,henry,9,greg,2021-04-13,,,,"3/1 collapsed" +2021,henry,9,greg,2021-04-19,,,,"3/1 collapsed" +2021,henry,9,greg,2021-04-26,,,,"3/1 collapsed" +2021,henry,9,greg,2021-05-03,,,,"3/1 collapsed" +2021,henry,43,greg,2021-02-09,,,, +2021,henry,43,greg,2021-02-15,3,,incubating, +2021,henry,43,greg,2021-02-22,3,,incubating, +2021,henry,43,greg,2021-03-01,3,,incubating, +2021,henry,43,greg,2021-03-08,1,2,hatching, +2021,henry,43,greg,2021-03-15,,2,nestling, +2021,henry,43,greg,2021-03-22,,3,nestling, +2021,henry,43,greg,2021-03-29,,2,nestling, +2021,henry,43,greg,2021-04-05,,2,nestling, +2021,henry,43,greg,2021-04-13,,0,fledged, +2021,henry,43,greg,2021-04-19,,,, +2021,henry,43,greg,2021-04-26,,,, +2021,henry,43,greg,2021-05-03,,,, +2021,henry,12,greg,2021-02-09,4,,incubating,"4/19 1+ Chicks" +2021,henry,12,greg,2021-02-15,1,,incubating,"4/19 1+ Chicks" +2021,henry,12,greg,2021-02-22,1,,incubating,"4/19 1+ Chicks" +2021,henry,12,greg,2021-03-01,3,,incubating,"4/19 1+ Chicks" +2021,henry,12,greg,2021-03-08,3,,incubating,"4/19 1+ Chicks" +2021,henry,12,greg,2021-03-15,3,,incubating,"4/19 1+ Chicks" +2021,henry,12,greg,2021-03-22,1,2,hatching,"4/19 1+ Chicks" +2021,henry,12,greg,2021-03-29,,3,nestling,"4/19 1+ Chicks" +2021,henry,12,greg,2021-04-05,,3,nestling,"4/19 1+ Chicks" +2021,henry,12,greg,2021-04-13,,3,nestling,"4/19 1+ Chicks" +2021,henry,12,greg,2021-04-19,,1,fledged,"4/19 1+ Chicks" +2021,henry,12,greg,2021-04-26,,,,"4/19 1+ Chicks" +2021,henry,12,greg,2021-05-03,,,,"4/19 1+ Chicks" +2021,henry,16,greg,2021-02-09,3,,incubating, +2021,henry,16,greg,2021-02-15,3,,incubating, +2021,henry,16,greg,2021-02-22,3,,incubating, +2021,henry,16,greg,2021-03-01,3,,incubating, +2021,henry,16,greg,2021-03-08,,3,nestling, +2021,henry,16,greg,2021-03-15,,3,nestling, +2021,henry,16,greg,2021-03-22,,3,nestling, +2021,henry,16,greg,2021-03-29,,3,nestling, +2021,henry,16,greg,2021-04-05,,3,nestling, +2021,henry,16,greg,2021-04-13,,0,fledged, +2021,henry,16,greg,2021-04-19,,,, +2021,henry,16,greg,2021-04-26,,,, +2021,henry,16,greg,2021-05-03,,,, +2021,henry,14,greg,2021-02-09,1,,incubating, +2021,henry,14,greg,2021-02-15,3,,incubating, +2021,henry,14,greg,2021-02-22,3,,incubating, +2021,henry,14,greg,2021-03-01,3,,pipping, +2021,henry,14,greg,2021-03-08,3,,pipping, +2021,henry,14,greg,2021-03-15,,3,nestling, +2021,henry,14,greg,2021-03-22,,3,nestling, +2021,henry,14,greg,2021-03-29,,3,nestling, +2021,henry,14,greg,2021-04-05,,3,nestling, +2021,henry,14,greg,2021-04-13,,0,fledged, +2021,henry,14,greg,2021-04-19,,,, +2021,henry,14,greg,2021-04-26,,,, +2021,henry,14,greg,2021-05-03,,,, +2021,henry,20,greg,2021-02-09,1,,incubating,"3/29: additional dead chick present" +2021,henry,20,greg,2021-02-15,4,,incubating,"3/29: additional dead chick present" +2021,henry,20,greg,2021-02-22,4,,incubating,"3/29: additional dead chick present" +2021,henry,20,greg,2021-03-01,4,,incubating,"3/29: additional dead chick present" +2021,henry,20,greg,2021-03-08,4,,incubating,"3/29: additional dead chick present" +2021,henry,20,greg,2021-03-15,,3,nestling,"3/29: additional dead chick present" +2021,henry,20,greg,2021-03-22,,4,nestling,"3/29: additional dead chick present" +2021,henry,20,greg,2021-03-29,,3,nestling,"3/29: additional dead chick present" +2021,henry,20,greg,2021-04-05,,3,nestling,"3/29: additional dead chick present" +2021,henry,20,greg,2021-04-13,,3,nestling,"3/29: additional dead chick present" +2021,henry,20,greg,2021-04-19,,0,fledged,"3/29: additional dead chick present" +2021,henry,20,greg,2021-04-26,,,,"3/29: additional dead chick present" +2021,henry,20,greg,2021-05-03,,,,"3/29: additional dead chick present" +2021,henry,22,greg,2021-02-09,1,,incubating,"2/15 collapsed" +2021,henry,22,greg,2021-02-15,0,,empty,"2/15 collapsed" +2021,henry,22,greg,2021-02-22,,,,"2/15 collapsed" +2021,henry,22,greg,2021-03-01,,,,"2/15 collapsed" +2021,henry,22,greg,2021-03-08,,,,"2/15 collapsed" +2021,henry,22,greg,2021-03-15,,,,"2/15 collapsed" +2021,henry,22,greg,2021-03-22,,,,"2/15 collapsed" +2021,henry,22,greg,2021-03-29,,,,"2/15 collapsed" +2021,henry,22,greg,2021-04-05,,,,"2/15 collapsed" +2021,henry,22,greg,2021-04-13,,,,"2/15 collapsed" +2021,henry,22,greg,2021-04-19,,,,"2/15 collapsed" +2021,henry,22,greg,2021-04-26,,,,"2/15 collapsed" +2021,henry,22,greg,2021-05-03,,,,"2/15 collapsed" +2021,henry,52,greg,2021-02-09,,,, +2021,henry,52,greg,2021-02-15,3,,incubating, +2021,henry,52,greg,2021-02-22,0,,empty, +2021,henry,52,greg,2021-03-01,1,,incubating, +2021,henry,52,greg,2021-03-08,3,,incubating, +2021,henry,52,greg,2021-03-15,3,,incubating, +2021,henry,52,greg,2021-03-22,0,,empty, +2021,henry,52,greg,2021-03-29,1,2,hatching, +2021,henry,52,greg,2021-04-05,,2,nestling, +2021,henry,52,greg,2021-04-13,,2,nestling, +2021,henry,52,greg,2021-04-19,,2,, +2021,henry,52,greg,2021-04-26,,2,fledged, +2021,henry,52,greg,2021-05-03,,,, +2021,henry,149,greg,2021-02-09,,,, +2021,henry,149,greg,2021-02-15,,,, +2021,henry,149,greg,2021-02-22,,,, +2021,henry,149,greg,2021-03-01,3,,incubating, +2021,henry,149,greg,2021-03-08,4,,incubating, +2021,henry,149,greg,2021-03-15,4,,incubating, +2021,henry,149,greg,2021-03-22,4,,incubating, +2021,henry,149,greg,2021-03-29,,3,nestling, +2021,henry,149,greg,2021-04-05,,4,nestling, +2021,henry,149,greg,2021-04-13,,4,nestling, +2021,henry,149,greg,2021-04-19,,3,, +2021,henry,149,greg,2021-04-26,,0,fledged, +2021,henry,149,greg,2021-05-03,,,, +2021,henry,151,greg,2021-02-09,,,, +2021,henry,151,greg,2021-02-15,,,, +2021,henry,151,greg,2021-02-22,,,, +2021,henry,151,greg,2021-03-01,3,,incubating, +2021,henry,151,greg,2021-03-08,3,,incubating, +2021,henry,151,greg,2021-03-15,3,,incubating, +2021,henry,151,greg,2021-03-22,2,1,pipping, +2021,henry,151,greg,2021-03-29,,2,nestling, +2021,henry,151,greg,2021-04-05,,3,nestling, +2021,henry,151,greg,2021-04-13,,3,nestling, +2021,henry,151,greg,2021-04-19,,3,, +2021,henry,151,greg,2021-04-26,,0,fledged, +2021,henry,151,greg,2021-05-03,,,, +2021,henry,54,greg,2021-02-09,,,, +2021,henry,54,greg,2021-02-15,3,,incubating, +2021,henry,54,greg,2021-02-22,3,,incubating, +2021,henry,54,greg,2021-03-01,3,,incubating, +2021,henry,54,greg,2021-03-08,,3,nestling, +2021,henry,54,greg,2021-03-15,,2,nestling, +2021,henry,54,greg,2021-03-22,,2,nestling, +2021,henry,54,greg,2021-03-29,,2,nestling, +2021,henry,54,greg,2021-04-05,,2,nestling, +2021,henry,54,greg,2021-04-13,,2,nestling, +2021,henry,54,greg,2021-04-19,,0,fledged, +2021,henry,54,greg,2021-04-26,,,, +2021,henry,54,greg,2021-05-03,,,, +2021,henry,18,greg,2021-02-09,3,,incubating,"3/8 3 + chicks visible 3/25 4th dead chick present, 4/5 could be more chicks only the one seen, 4/13 mercury" +2021,henry,18,greg,2021-02-15,4,,incubating,"3/8 3 + chicks visible 3/25 4th dead chick present, 4/5 could be more chicks only the one seen, 4/13 mercury" +2021,henry,18,greg,2021-02-22,4,,incubating,"3/8 3 + chicks visible 3/25 4th dead chick present, 4/5 could be more chicks only the one seen, 4/13 mercury" +2021,henry,18,greg,2021-03-01,4,,pipping,"3/8 3 + chicks visible 3/25 4th dead chick present, 4/5 could be more chicks only the one seen, 4/13 mercury" +2021,henry,18,greg,2021-03-08,,3,nestling,"3/8 3 + chicks visible 3/25 4th dead chick present, 4/5 could be more chicks only the one seen, 4/13 mercury" +2021,henry,18,greg,2021-03-15,,3,nestling,"3/8 3 + chicks visible 3/25 4th dead chick present, 4/5 could be more chicks only the one seen, 4/13 mercury" +2021,henry,18,greg,2021-03-22,,3,nestling,"3/8 3 + chicks visible 3/25 4th dead chick present, 4/5 could be more chicks only the one seen, 4/13 mercury" +2021,henry,18,greg,2021-03-29,,3,nestling,"3/8 3 + chicks visible 3/25 4th dead chick present, 4/5 could be more chicks only the one seen, 4/13 mercury" +2021,henry,18,greg,2021-04-05,,1,nestling,"3/8 3 + chicks visible 3/25 4th dead chick present, 4/5 could be more chicks only the one seen, 4/13 mercury" +2021,henry,18,greg,2021-04-13,,1,nestling,"3/8 3 + chicks visible 3/25 4th dead chick present, 4/5 could be more chicks only the one seen, 4/13 mercury" +2021,henry,18,greg,2021-04-19,,0,fledged,"3/8 3 + chicks visible 3/25 4th dead chick present, 4/5 could be more chicks only the one seen, 4/13 mercury" +2021,henry,18,greg,2021-04-26,,,,"3/8 3 + chicks visible 3/25 4th dead chick present, 4/5 could be more chicks only the one seen, 4/13 mercury" +2021,henry,18,greg,2021-05-03,,,,"3/8 3 + chicks visible 3/25 4th dead chick present, 4/5 could be more chicks only the one seen, 4/13 mercury" +2021,henry,24,greg,2021-02-09,1,,incubating,"4/5 sampled for mercury" +2021,henry,24,greg,2021-02-15,3,,incubating,"4/5 sampled for mercury" +2021,henry,24,greg,2021-02-22,3,,incubating,"4/5 sampled for mercury" +2021,henry,24,greg,2021-03-01,3,,incubating,"4/5 sampled for mercury" +2021,henry,24,greg,2021-03-08,2,1,wet_chick,"4/5 sampled for mercury" +2021,henry,24,greg,2021-03-15,,3,nestling,"4/5 sampled for mercury" +2021,henry,24,greg,2021-03-22,,3,nestling,"4/5 sampled for mercury" +2021,henry,24,greg,2021-03-29,,3,nestling,"4/5 sampled for mercury" +2021,henry,24,greg,2021-04-05,,3,nestling,"4/5 sampled for mercury" +2021,henry,24,greg,2021-04-13,,0,fledged,"4/5 sampled for mercury" +2021,henry,24,greg,2021-04-19,,,,"4/5 sampled for mercury" +2021,henry,24,greg,2021-04-26,,,,"4/5 sampled for mercury" +2021,henry,24,greg,2021-05-03,,,,"4/5 sampled for mercury" +2021,henry,13,greg,2021-02-09,2,,incubating, +2021,henry,13,greg,2021-02-15,4,,incubating, +2021,henry,13,greg,2021-02-22,4,,incubating, +2021,henry,13,greg,2021-03-01,4,,incubating, +2021,henry,13,greg,2021-03-08,2,2,wet_chick, +2021,henry,13,greg,2021-03-15,,4,nestling, +2021,henry,13,greg,2021-03-22,,4,nestling, +2021,henry,13,greg,2021-03-29,,3,nestling, +2021,henry,13,greg,2021-04-05,,2,nestling, +2021,henry,13,greg,2021-04-13,,1,nestling, +2021,henry,13,greg,2021-04-19,,0,fledged, +2021,henry,13,greg,2021-04-26,,,, +2021,henry,13,greg,2021-05-03,,,, +2021,henry,26,greg,2021-02-09,1,,incubating,"4/5 sampled for mercury" +2021,henry,26,greg,2021-02-15,3,,incubating,"4/5 sampled for mercury" +2021,henry,26,greg,2021-02-22,3,,incubating,"4/5 sampled for mercury" +2021,henry,26,greg,2021-03-01,3,,incubating,"4/5 sampled for mercury" +2021,henry,26,greg,2021-03-08,2,1,wet_chick,"4/5 sampled for mercury" +2021,henry,26,greg,2021-03-15,,3,nestling,"4/5 sampled for mercury" +2021,henry,26,greg,2021-03-22,,3,nestling,"4/5 sampled for mercury" +2021,henry,26,greg,2021-03-29,,3,nestling,"4/5 sampled for mercury" +2021,henry,26,greg,2021-04-05,,3,nestling,"4/5 sampled for mercury" +2021,henry,26,greg,2021-04-13,,1,nestling,"4/5 sampled for mercury" +2021,henry,26,greg,2021-04-19,,0,fledged,"4/5 sampled for mercury" +2021,henry,26,greg,2021-04-26,,,,"4/5 sampled for mercury" +2021,henry,26,greg,2021-05-03,,,,"4/5 sampled for mercury" +2021,henry,28,greg,2021-02-09,3,,incubating, +2021,henry,28,greg,2021-02-15,3,,incubating, +2021,henry,28,greg,2021-02-22,3,,incubating, +2021,henry,28,greg,2021-03-01,3,,incubating, +2021,henry,28,greg,2021-03-08,,3,nestling, +2021,henry,28,greg,2021-03-15,,3,nestling, +2021,henry,28,greg,2021-03-22,,3,nestling, +2021,henry,28,greg,2021-03-29,,,missed, +2021,henry,28,greg,2021-04-05,,2,nestling, +2021,henry,28,greg,2021-04-13,,2,nestling, +2021,henry,28,greg,2021-04-19,,0,fledged, +2021,henry,28,greg,2021-04-26,,,, +2021,henry,28,greg,2021-05-03,,,, +2021,henry,15,greg,2021-02-09,3,,incubating, +2021,henry,15,greg,2021-02-15,3,,incubating, +2021,henry,15,greg,2021-02-22,3,,incubating, +2021,henry,15,greg,2021-03-01,2,1,, +2021,henry,15,greg,2021-03-08,,3,nestling, +2021,henry,15,greg,2021-03-15,,3,nestling, +2021,henry,15,greg,2021-03-22,,2,nestling, +2021,henry,15,greg,2021-03-29,,1,nestling, +2021,henry,15,greg,2021-04-05,,2,nestling, +2021,henry,15,greg,2021-04-13,,0,fledged, +2021,henry,15,greg,2021-04-19,,,, +2021,henry,15,greg,2021-04-26,,,, +2021,henry,15,greg,2021-05-03,,,, +2021,henry,17,greg,2021-02-09,3,,incubating, +2021,henry,17,greg,2021-02-15,3,,incubating, +2021,henry,17,greg,2021-02-22,3,,incubating, +2021,henry,17,greg,2021-03-01,3,,incubating, +2021,henry,17,greg,2021-03-08,,3,nestling, +2021,henry,17,greg,2021-03-15,,3,nestling, +2021,henry,17,greg,2021-03-22,,3,nestling, +2021,henry,17,greg,2021-03-29,,,missed, +2021,henry,17,greg,2021-04-05,,2,nestling, +2021,henry,17,greg,2021-04-13,,0,fledged, +2021,henry,17,greg,2021-04-19,,,, +2021,henry,17,greg,2021-04-26,,,, +2021,henry,17,greg,2021-05-03,,,, +2021,henry,23,greg,2021-02-09,2,,incubating, +2021,henry,23,greg,2021-02-15,4,,incubating, +2021,henry,23,greg,2021-02-22,4,,incubating, +2021,henry,23,greg,2021-03-01,4,,incubating, +2021,henry,23,greg,2021-03-08,2,2,wet_chick, +2021,henry,23,greg,2021-03-15,,4,nestling, +2021,henry,23,greg,2021-03-22,,3,nestling, +2021,henry,23,greg,2021-03-29,,3,nestling, +2021,henry,23,greg,2021-04-05,,2,nestling, +2021,henry,23,greg,2021-04-13,,0,fledged, +2021,henry,23,greg,2021-04-19,,,, +2021,henry,23,greg,2021-04-26,,,, +2021,henry,23,greg,2021-05-03,,,, +2021,henry,21,greg,2021-02-09,4,,incubating, +2021,henry,21,greg,2021-02-15,4,,incubating, +2021,henry,21,greg,2021-02-22,3,,incubating, +2021,henry,21,greg,2021-03-01,3,1,wet_chick, +2021,henry,21,greg,2021-03-08,,4,nestling, +2021,henry,21,greg,2021-03-15,,3,nestling, +2021,henry,21,greg,2021-03-22,,3,nestling, +2021,henry,21,greg,2021-03-29,,3,nestling, +2021,henry,21,greg,2021-04-05,,2,nestling, +2021,henry,21,greg,2021-04-13,,0,fledged, +2021,henry,21,greg,2021-04-19,,,, +2021,henry,21,greg,2021-04-26,,,, +2021,henry,21,greg,2021-05-03,,,, +2021,henry,30,greg,2021-02-09,1,,incubating, +2021,henry,30,greg,2021-02-15,2,,incubating, +2021,henry,30,greg,2021-02-22,2,,incubating, +2021,henry,30,greg,2021-03-01,2,,incubating, +2021,henry,30,greg,2021-03-08,,2,nestling, +2021,henry,30,greg,2021-03-15,,2,nestling, +2021,henry,30,greg,2021-03-22,,2,nestling, +2021,henry,30,greg,2021-03-29,,1,nestling, +2021,henry,30,greg,2021-04-05,,0,fledged, +2021,henry,30,greg,2021-04-13,,,, +2021,henry,30,greg,2021-04-19,,,, +2021,henry,30,greg,2021-04-26,,,, +2021,henry,30,greg,2021-05-03,,,, +2021,henry,25,greg,2021-02-09,3,,incubating,"3/29 4th chick probably from neighboring nest" +2021,henry,25,greg,2021-02-15,3,,incubating,"3/29 4th chick probably from neighboring nest" +2021,henry,25,greg,2021-02-22,3,,incubating,"3/29 4th chick probably from neighboring nest" +2021,henry,25,greg,2021-03-01,3,,incubating,"3/29 4th chick probably from neighboring nest" +2021,henry,25,greg,2021-03-08,,3,nestling,"3/29 4th chick probably from neighboring nest" +2021,henry,25,greg,2021-03-15,,3,nestling,"3/29 4th chick probably from neighboring nest" +2021,henry,25,greg,2021-03-22,,3,nestling,"3/29 4th chick probably from neighboring nest" +2021,henry,25,greg,2021-03-29,,4,nestling,"3/29 4th chick probably from neighboring nest" +2021,henry,25,greg,2021-04-05,,2,nestling,"3/29 4th chick probably from neighboring nest" +2021,henry,25,greg,2021-04-13,,1,nestling,"3/29 4th chick probably from neighboring nest" +2021,henry,25,greg,2021-04-19,,0,fledged,"3/29 4th chick probably from neighboring nest" +2021,henry,25,greg,2021-04-26,,,,"3/29 4th chick probably from neighboring nest" +2021,henry,25,greg,2021-05-03,,,,"3/29 4th chick probably from neighboring nest" +2021,henry,45,greg,2021-02-09,,,,"4/5 only one chick seen, could be more, 4/13 mercury" +2021,henry,45,greg,2021-02-15,1,,incubating,"4/5 only one chick seen, could be more, 4/13 mercury" +2021,henry,45,greg,2021-02-22,3,,incubating,"4/5 only one chick seen, could be more, 4/13 mercury" +2021,henry,45,greg,2021-03-01,3,,incubating,"4/5 only one chick seen, could be more, 4/13 mercury" +2021,henry,45,greg,2021-03-08,3,,incubating,"4/5 only one chick seen, could be more, 4/13 mercury" +2021,henry,45,greg,2021-03-15,2,1,pipping,"4/5 only one chick seen, could be more, 4/13 mercury" +2021,henry,45,greg,2021-03-22,,3,nestling,"4/5 only one chick seen, could be more, 4/13 mercury" +2021,henry,45,greg,2021-03-29,,,missed,"4/5 only one chick seen, could be more, 4/13 mercury" +2021,henry,45,greg,2021-04-05,,1,nestling,"4/5 only one chick seen, could be more, 4/13 mercury" +2021,henry,45,greg,2021-04-13,,2,nestling,"4/5 only one chick seen, could be more, 4/13 mercury" +2021,henry,45,greg,2021-04-19,,0,fledged,"4/5 only one chick seen, could be more, 4/13 mercury" +2021,henry,45,greg,2021-04-26,,,,"4/5 only one chick seen, could be more, 4/13 mercury" +2021,henry,45,greg,2021-05-03,,,,"4/5 only one chick seen, could be more, 4/13 mercury" +2021,henry,32,greg,2021-02-09,3,,incubating,"3/25 1 dead egg also present" +2021,henry,32,greg,2021-02-15,3,,incubating,"3/25 1 dead egg also present" +2021,henry,32,greg,2021-02-22,3,,incubating,"3/25 1 dead egg also present" +2021,henry,32,greg,2021-03-01,2,1,wet_chick,"3/25 1 dead egg also present" +2021,henry,32,greg,2021-03-08,1,2,nestling,"3/25 1 dead egg also present" +2021,henry,32,greg,2021-03-15,,2,nestling,"3/25 1 dead egg also present" +2021,henry,32,greg,2021-03-22,1,2,hatching,"3/25 1 dead egg also present" +2021,henry,32,greg,2021-03-29,,2,nestling,"3/25 1 dead egg also present" +2021,henry,32,greg,2021-04-05,,2,nestling,"3/25 1 dead egg also present" +2021,henry,32,greg,2021-04-13,,0,fledged,"3/25 1 dead egg also present" +2021,henry,32,greg,2021-04-19,,,,"3/25 1 dead egg also present" +2021,henry,32,greg,2021-04-26,,,,"3/25 1 dead egg also present" +2021,henry,32,greg,2021-05-03,,,,"3/25 1 dead egg also present" +2021,henry,49,greg,2021-02-09,,,, +2021,henry,49,greg,2021-02-15,4,,incubating, +2021,henry,49,greg,2021-02-22,4,,incubating, +2021,henry,49,greg,2021-03-01,4,,incubating, +2021,henry,49,greg,2021-03-08,,4,nestling, +2021,henry,49,greg,2021-03-15,,3,nestling, +2021,henry,49,greg,2021-03-22,,3,nestling, +2021,henry,49,greg,2021-03-29,,3,nestling, +2021,henry,49,greg,2021-04-05,,2,nestling, +2021,henry,49,greg,2021-04-13,,1,nestling, +2021,henry,49,greg,2021-04-19,,0,fledged, +2021,henry,49,greg,2021-04-26,,,, +2021,henry,49,greg,2021-05-03,,,, +2021,henry,69,greg,2021-02-09,,,,"4/13 sampled for mercury" +2021,henry,69,greg,2021-02-15,,,,"4/13 sampled for mercury" +2021,henry,69,greg,2021-02-22,,,,"4/13 sampled for mercury" +2021,henry,69,greg,2021-03-01,3,,incubating,"4/13 sampled for mercury" +2021,henry,69,greg,2021-03-08,3,,incubating,"4/13 sampled for mercury" +2021,henry,69,greg,2021-03-15,3,,incubating,"4/13 sampled for mercury" +2021,henry,69,greg,2021-03-22,2,1,wet_chick,"4/13 sampled for mercury" +2021,henry,69,greg,2021-03-29,,,missed,"4/13 sampled for mercury" +2021,henry,69,greg,2021-04-05,,4,nestling,"4/13 sampled for mercury" +2021,henry,69,greg,2021-04-13,,3,nestling,"4/13 sampled for mercury" +2021,henry,69,greg,2021-04-19,,0,fledged,"4/13 sampled for mercury" +2021,henry,69,greg,2021-04-26,,,,"4/13 sampled for mercury" +2021,henry,69,greg,2021-05-03,,,,"4/13 sampled for mercury" +2021,henry,36,greg,2021-02-09,3,,incubating,"4/5 only one chick seen, possibly more" +2021,henry,36,greg,2021-02-15,3,,incubating,"4/5 only one chick seen, possibly more" +2021,henry,36,greg,2021-02-22,3,,incubating,"4/5 only one chick seen, possibly more" +2021,henry,36,greg,2021-03-01,3,,incubating,"4/5 only one chick seen, possibly more" +2021,henry,36,greg,2021-03-08,,3,nestling,"4/5 only one chick seen, possibly more" +2021,henry,36,greg,2021-03-15,,3,nestling,"4/5 only one chick seen, possibly more" +2021,henry,36,greg,2021-03-22,,3,nestling,"4/5 only one chick seen, possibly more" +2021,henry,36,greg,2021-03-29,,2,nestling,"4/5 only one chick seen, possibly more" +2021,henry,36,greg,2021-04-05,,1,nestling,"4/5 only one chick seen, possibly more" +2021,henry,36,greg,2021-04-13,,2,nestling,"4/5 only one chick seen, possibly more" +2021,henry,36,greg,2021-04-19,,0,fledged,"4/5 only one chick seen, possibly more" +2021,henry,36,greg,2021-04-26,,,,"4/5 only one chick seen, possibly more" +2021,henry,36,greg,2021-05-03,,,,"4/5 only one chick seen, possibly more" +2021,henry,34,greg,2021-02-09,2,,incubating,"4/5 only two chicks seen, possibly more, 4/5 mercury" +2021,henry,34,greg,2021-02-15,3,,incubating,"4/5 only two chicks seen, possibly more, 4/5 mercury" +2021,henry,34,greg,2021-02-22,4,,incubating,"4/5 only two chicks seen, possibly more, 4/5 mercury" +2021,henry,34,greg,2021-03-01,3,,incubating,"4/5 only two chicks seen, possibly more, 4/5 mercury" +2021,henry,34,greg,2021-03-08,1,2,hatching,"4/5 only two chicks seen, possibly more, 4/5 mercury" +2021,henry,34,greg,2021-03-15,,3,nestling,"4/5 only two chicks seen, possibly more, 4/5 mercury" +2021,henry,34,greg,2021-03-22,,3,nestling,"4/5 only two chicks seen, possibly more, 4/5 mercury" +2021,henry,34,greg,2021-03-29,,3,nestling,"4/5 only two chicks seen, possibly more, 4/5 mercury" +2021,henry,34,greg,2021-04-05,,2,nestling,"4/5 only two chicks seen, possibly more, 4/5 mercury" +2021,henry,34,greg,2021-04-13,,1,nestling,"4/5 only two chicks seen, possibly more, 4/5 mercury" +2021,henry,34,greg,2021-04-19,,0,fledged,"4/5 only two chicks seen, possibly more, 4/5 mercury" +2021,henry,34,greg,2021-04-26,,,,"4/5 only two chicks seen, possibly more, 4/5 mercury" +2021,henry,34,greg,2021-05-03,,,,"4/5 only two chicks seen, possibly more, 4/5 mercury" +2021,henry,27,greg,2021-02-09,2,,incubating, +2021,henry,27,greg,2021-02-15,3,,incubating, +2021,henry,27,greg,2021-02-22,3,,incubating, +2021,henry,27,greg,2021-03-01,2,,incubating, +2021,henry,27,greg,2021-03-08,1,1,wet_chick, +2021,henry,27,greg,2021-03-15,,2,nestling, +2021,henry,27,greg,2021-03-22,,2,nestling, +2021,henry,27,greg,2021-03-29,,2,nestling, +2021,henry,27,greg,2021-04-05,,2,nestling, +2021,henry,27,greg,2021-04-13,,2,nestling, +2021,henry,27,greg,2021-04-19,,0,fledged, +2021,henry,27,greg,2021-04-26,,,, +2021,henry,27,greg,2021-05-03,,,, +2021,henry,47,greg,2021-02-09,,,, +2021,henry,47,greg,2021-02-15,3,,incubating, +2021,henry,47,greg,2021-02-22,3,,incubating, +2021,henry,47,greg,2021-03-01,3,,incubating, +2021,henry,47,greg,2021-03-08,,3,nestling, +2021,henry,47,greg,2021-03-15,,3,nestling, +2021,henry,47,greg,2021-03-22,,3,nestling, +2021,henry,47,greg,2021-03-29,,2,nestling, +2021,henry,47,greg,2021-04-05,,0,fledged, +2021,henry,47,greg,2021-04-13,,,, +2021,henry,47,greg,2021-04-19,,,, +2021,henry,47,greg,2021-04-26,,,, +2021,henry,47,greg,2021-05-03,,,, +2021,henry,133,greg,2021-02-09,,,, +2021,henry,133,greg,2021-02-15,,,, +2021,henry,133,greg,2021-02-22,3,,incubating, +2021,henry,133,greg,2021-03-01,3,,incubating, +2021,henry,133,greg,2021-03-08,,3,nestling, +2021,henry,133,greg,2021-03-15,,3,nestling, +2021,henry,133,greg,2021-03-22,,2,nestling, +2021,henry,133,greg,2021-03-29,,2,nestling, +2021,henry,133,greg,2021-04-05,,2,nestling, +2021,henry,133,greg,2021-04-13,,1,nestling, +2021,henry,133,greg,2021-04-19,,0,fledged, +2021,henry,133,greg,2021-04-26,,,, +2021,henry,133,greg,2021-05-03,,,, +2021,henry,135,greg,2021-02-09,,,,"4/5 only one chick seen possibly more" +2021,henry,135,greg,2021-02-15,,,,"4/5 only one chick seen possibly more" +2021,henry,135,greg,2021-02-22,3,,incubating,"4/5 only one chick seen possibly more" +2021,henry,135,greg,2021-03-01,3,,incubating,"4/5 only one chick seen possibly more" +2021,henry,135,greg,2021-03-08,,3,nestling,"4/5 only one chick seen possibly more" +2021,henry,135,greg,2021-03-15,,3,nestling,"4/5 only one chick seen possibly more" +2021,henry,135,greg,2021-03-22,,2,nestling,"4/5 only one chick seen possibly more" +2021,henry,135,greg,2021-03-29,,2,nestling,"4/5 only one chick seen possibly more" +2021,henry,135,greg,2021-04-05,,1,nestling,"4/5 only one chick seen possibly more" +2021,henry,135,greg,2021-04-13,,0,fledged,"4/5 only one chick seen possibly more" +2021,henry,135,greg,2021-04-19,,,,"4/5 only one chick seen possibly more" +2021,henry,135,greg,2021-04-26,,,,"4/5 only one chick seen possibly more" +2021,henry,135,greg,2021-05-03,,,,"4/5 only one chick seen possibly more" +2021,henry,139,greg,2021-02-09,,,, +2021,henry,139,greg,2021-02-15,,,, +2021,henry,139,greg,2021-02-22,4,,incubating, +2021,henry,139,greg,2021-03-01,4,,incubating, +2021,henry,139,greg,2021-03-08,4,,incubating, +2021,henry,139,greg,2021-03-15,1,3,hatching, +2021,henry,139,greg,2021-03-22,,4,nestling, +2021,henry,139,greg,2021-03-29,,3,nestling, +2021,henry,139,greg,2021-04-05,,2,nestling, +2021,henry,139,greg,2021-04-13,,0,fledged, +2021,henry,139,greg,2021-04-19,,,, +2021,henry,139,greg,2021-04-26,,,, +2021,henry,139,greg,2021-05-03,,,, +2021,henry,137,greg,2021-02-09,,,, +2021,henry,137,greg,2021-02-15,,,, +2021,henry,137,greg,2021-02-22,3,,incubating, +2021,henry,137,greg,2021-03-01,3,,incubating, +2021,henry,137,greg,2021-03-08,,3,nestling, +2021,henry,137,greg,2021-03-15,,3,nestling, +2021,henry,137,greg,2021-03-22,,3,nestling, +2021,henry,137,greg,2021-03-29,,3,nestling, +2021,henry,137,greg,2021-04-05,,0,fledged, +2021,henry,137,greg,2021-04-13,,,, +2021,henry,137,greg,2021-04-19,,,, +2021,henry,137,greg,2021-04-26,,,, +2021,henry,137,greg,2021-05-03,,,, +2021,henry,141,greg,2021-02-09,,,, +2021,henry,141,greg,2021-02-15,,,, +2021,henry,141,greg,2021-02-22,4,,incubating, +2021,henry,141,greg,2021-03-01,4,,incubating, +2021,henry,141,greg,2021-03-08,1,3,hatching, +2021,henry,141,greg,2021-03-15,,3,nestling, +2021,henry,141,greg,2021-03-22,,4,nestling, +2021,henry,141,greg,2021-03-29,,3,nestling, +2021,henry,141,greg,2021-04-05,,3,nestling, +2021,henry,141,greg,2021-04-13,,3,nestling, +2021,henry,141,greg,2021-04-19,,0,fledged, +2021,henry,141,greg,2021-04-26,,,, +2021,henry,141,greg,2021-05-03,,,, +2021,henry,80,greg,2021-02-09,,,,"3/29 additional dead chick present, 4/5 #80 and #78 have 4C with one dead C between them" +2021,henry,80,greg,2021-02-15,,,,"3/29 additional dead chick present, 4/5 #80 and #78 have 4C with one dead C between them" +2021,henry,80,greg,2021-02-22,3,,incubating,"3/29 additional dead chick present, 4/5 #80 and #78 have 4C with one dead C between them" +2021,henry,80,greg,2021-03-01,3,,incubating,"3/29 additional dead chick present, 4/5 #80 and #78 have 4C with one dead C between them" +2021,henry,80,greg,2021-03-08,,3,nestling,"3/29 additional dead chick present, 4/5 #80 and #78 have 4C with one dead C between them" +2021,henry,80,greg,2021-03-15,,3,nestling,"3/29 additional dead chick present, 4/5 #80 and #78 have 4C with one dead C between them" +2021,henry,80,greg,2021-03-22,,2,nestling,"3/29 additional dead chick present, 4/5 #80 and #78 have 4C with one dead C between them" +2021,henry,80,greg,2021-03-29,,1,nestling,"3/29 additional dead chick present, 4/5 #80 and #78 have 4C with one dead C between them" +2021,henry,80,greg,2021-04-05,,1,nestling,"3/29 additional dead chick present, 4/5 #80 and #78 have 4C with one dead C between them" +2021,henry,80,greg,2021-04-13,,0,fledged,"3/29 additional dead chick present, 4/5 #80 and #78 have 4C with one dead C between them" +2021,henry,80,greg,2021-04-19,,,,"3/29 additional dead chick present, 4/5 #80 and #78 have 4C with one dead C between them" +2021,henry,80,greg,2021-04-26,,,,"3/29 additional dead chick present, 4/5 #80 and #78 have 4C with one dead C between them" +2021,henry,80,greg,2021-05-03,,,,"3/29 additional dead chick present, 4/5 #80 and #78 have 4C with one dead C between them" +2021,henry,78,greg,2021-02-09,,,,"4/5 (see comment for #80)" +2021,henry,78,greg,2021-02-15,,,,"4/5 (see comment for #80)" +2021,henry,78,greg,2021-02-22,3,,incubating,"4/5 (see comment for #80)" +2021,henry,78,greg,2021-03-01,3,,incubating,"4/5 (see comment for #80)" +2021,henry,78,greg,2021-03-08,1,2,hatching,"4/5 (see comment for #80)" +2021,henry,78,greg,2021-03-15,,3,nestling,"4/5 (see comment for #80)" +2021,henry,78,greg,2021-03-22,,3,nestling,"4/5 (see comment for #80)" +2021,henry,78,greg,2021-03-29,,3,nestling,"4/5 (see comment for #80)" +2021,henry,78,greg,2021-04-05,,3,nestling,"4/5 (see comment for #80)" +2021,henry,78,greg,2021-04-13,,0,fledged,"4/5 (see comment for #80)" +2021,henry,78,greg,2021-04-19,,,,"4/5 (see comment for #80)" +2021,henry,78,greg,2021-04-26,,,,"4/5 (see comment for #80)" +2021,henry,78,greg,2021-05-03,,,,"4/5 (see comment for #80)" +2021,henry,82,greg,2021-02-09,,,, +2021,henry,82,greg,2021-02-15,,,, +2021,henry,82,greg,2021-02-22,1,,incubating, +2021,henry,82,greg,2021-03-01,2,,incubating, +2021,henry,82,greg,2021-03-08,2,,incubating, +2021,henry,82,greg,2021-03-15,2,,incubating, +2021,henry,82,greg,2021-03-22,,2,nestling, +2021,henry,82,greg,2021-03-29,,2,nestling, +2021,henry,82,greg,2021-04-05,,2,nestling, +2021,henry,82,greg,2021-04-13,,2,nestling, +2021,henry,82,greg,2021-04-19,,0,fledged, +2021,henry,82,greg,2021-04-26,,,, +2021,henry,82,greg,2021-05-03,,,, +2021,henry,84,greg,2021-02-09,,,, +2021,henry,84,greg,2021-02-15,,,, +2021,henry,84,greg,2021-02-22,2,,incubating, +2021,henry,84,greg,2021-03-01,3,,incubating, +2021,henry,84,greg,2021-03-08,3,,incubating, +2021,henry,84,greg,2021-03-15,3,,incubating, +2021,henry,84,greg,2021-03-22,,3,nestling, +2021,henry,84,greg,2021-03-29,,3,nestling, +2021,henry,84,greg,2021-04-05,,2,nestling, +2021,henry,84,greg,2021-04-13,,2,nestling, +2021,henry,84,greg,2021-04-19,,0,fledged, +2021,henry,84,greg,2021-04-26,,,, +2021,henry,84,greg,2021-05-03,,,, +2021,henry,86,greg,2021-02-09,,,,"3/15 relaid? 4/19 1 dead chick below nest" +2021,henry,86,greg,2021-02-15,,,,"3/15 relaid? 4/19 1 dead chick below nest" +2021,henry,86,greg,2021-02-22,3,,incubating,"3/15 relaid? 4/19 1 dead chick below nest" +2021,henry,86,greg,2021-03-01,2,,incubating,"3/15 relaid? 4/19 1 dead chick below nest" +2021,henry,86,greg,2021-03-08,0,,empty,"3/15 relaid? 4/19 1 dead chick below nest" +2021,henry,86,greg,2021-03-15,3,,incubating,"3/15 relaid? 4/19 1 dead chick below nest" +2021,henry,86,greg,2021-03-22,3,,incubating,"3/15 relaid? 4/19 1 dead chick below nest" +2021,henry,86,greg,2021-03-29,,,missed,"3/15 relaid? 4/19 1 dead chick below nest" +2021,henry,86,greg,2021-04-05,3,,incubating,"3/15 relaid? 4/19 1 dead chick below nest" +2021,henry,86,greg,2021-04-13,,3,nestling,"3/15 relaid? 4/19 1 dead chick below nest" +2021,henry,86,greg,2021-04-19,,2,,"3/15 relaid? 4/19 1 dead chick below nest" +2021,henry,86,greg,2021-04-26,,1,nestling,"3/15 relaid? 4/19 1 dead chick below nest" +2021,henry,86,greg,2021-05-03,,2,fledged,"3/15 relaid? 4/19 1 dead chick below nest" +2021,henry,88,greg,2021-02-09,,,,"4/26 1 dead cick hanging" +2021,henry,88,greg,2021-02-15,,,,"4/26 1 dead cick hanging" +2021,henry,88,greg,2021-02-22,4,,incubating,"4/26 1 dead cick hanging" +2021,henry,88,greg,2021-03-01,4,,incubating,"4/26 1 dead cick hanging" +2021,henry,88,greg,2021-03-08,,4,wet_chick,"4/26 1 dead cick hanging" +2021,henry,88,greg,2021-03-15,,3,nestling,"4/26 1 dead cick hanging" +2021,henry,88,greg,2021-03-22,,4,nestling,"4/26 1 dead cick hanging" +2021,henry,88,greg,2021-03-29,,1,nestling,"4/26 1 dead cick hanging" +2021,henry,88,greg,2021-04-05,,2,nestling,"4/26 1 dead cick hanging" +2021,henry,88,greg,2021-04-13,,2,nestling,"4/26 1 dead cick hanging" +2021,henry,88,greg,2021-04-19,,0,fledged,"4/26 1 dead cick hanging" +2021,henry,88,greg,2021-04-26,,,,"4/26 1 dead cick hanging" +2021,henry,88,greg,2021-05-03,,,,"4/26 1 dead cick hanging" +2021,henry,90,greg,2021-02-09,,,,"4/19 sampled for mercury" +2021,henry,90,greg,2021-02-15,,,,"4/19 sampled for mercury" +2021,henry,90,greg,2021-02-22,3,,incubating,"4/19 sampled for mercury" +2021,henry,90,greg,2021-03-01,3,,incubating,"4/19 sampled for mercury" +2021,henry,90,greg,2021-03-08,3,,incubating,"4/19 sampled for mercury" +2021,henry,90,greg,2021-03-15,3,,incubating,"4/19 sampled for mercury" +2021,henry,90,greg,2021-03-22,,3,nestling,"4/19 sampled for mercury" +2021,henry,90,greg,2021-03-29,,3,nestling,"4/19 sampled for mercury" +2021,henry,90,greg,2021-04-05,,3,nestling,"4/19 sampled for mercury" +2021,henry,90,greg,2021-04-13,,3,nestling,"4/19 sampled for mercury" +2021,henry,90,greg,2021-04-19,,3,,"4/19 sampled for mercury" +2021,henry,90,greg,2021-04-26,,,,"4/19 sampled for mercury" +2021,henry,90,greg,2021-05-03,,,,"4/19 sampled for mercury" +2021,henry,143,greg,2021-02-09,,,,"4/13 sampled for mercury" +2021,henry,143,greg,2021-02-15,,,,"4/13 sampled for mercury" +2021,henry,143,greg,2021-02-22,3,,incubating,"4/13 sampled for mercury" +2021,henry,143,greg,2021-03-01,3,,incubating,"4/13 sampled for mercury" +2021,henry,143,greg,2021-03-08,3,,incubating,"4/13 sampled for mercury" +2021,henry,143,greg,2021-03-15,3,,incubating,"4/13 sampled for mercury" +2021,henry,143,greg,2021-03-22,,3,nestling,"4/13 sampled for mercury" +2021,henry,143,greg,2021-03-29,,2,nestling,"4/13 sampled for mercury" +2021,henry,143,greg,2021-04-05,,2,nestling,"4/13 sampled for mercury" +2021,henry,143,greg,2021-04-13,,3,nestling,"4/13 sampled for mercury" +2021,henry,143,greg,2021-04-19,,0,fledged,"4/13 sampled for mercury" +2021,henry,143,greg,2021-04-26,,,,"4/13 sampled for mercury" +2021,henry,143,greg,2021-05-03,,,,"4/13 sampled for mercury" +2021,henry,92,greg,2021-02-09,,,, +2021,henry,92,greg,2021-02-15,,,, +2021,henry,92,greg,2021-02-22,1,,incubating, +2021,henry,92,greg,2021-03-01,3,,incubating, +2021,henry,92,greg,2021-03-08,4,,incubating, +2021,henry,92,greg,2021-03-15,4,,incubating, +2021,henry,92,greg,2021-03-22,2,2,wet_chick, +2021,henry,92,greg,2021-03-29,,4,nestling, +2021,henry,92,greg,2021-04-05,,3,nestling, +2021,henry,92,greg,2021-04-13,,2,nestling, +2021,henry,92,greg,2021-04-19,,2,, +2021,henry,92,greg,2021-04-26,,2,fledged, +2021,henry,92,greg,2021-05-03,,,, +2021,henry,147,greg,2021-02-09,,,, +2021,henry,147,greg,2021-02-15,,,, +2021,henry,147,greg,2021-02-22,1,,incubating, +2021,henry,147,greg,2021-03-01,3,,incubating, +2021,henry,147,greg,2021-03-08,3,,incubating, +2021,henry,147,greg,2021-03-15,3,,incubating, +2021,henry,147,greg,2021-03-22,1,2,pipping, +2021,henry,147,greg,2021-03-29,,2,nestling, +2021,henry,147,greg,2021-04-05,,2,nestling, +2021,henry,147,greg,2021-04-13,,2,nestling, +2021,henry,147,greg,2021-04-19,,2,, +2021,henry,147,greg,2021-04-26,,2,fledged, +2021,henry,147,greg,2021-05-03,,,, +2021,henry,157,greg,2021-02-09,,,,"4/26 1 dead chick in nest" +2021,henry,157,greg,2021-02-15,,,,"4/26 1 dead chick in nest" +2021,henry,157,greg,2021-02-22,,,,"4/26 1 dead chick in nest" +2021,henry,157,greg,2021-03-01,3,,incubating,"4/26 1 dead chick in nest" +2021,henry,157,greg,2021-03-08,3,,incubating,"4/26 1 dead chick in nest" +2021,henry,157,greg,2021-03-15,3,,incubating,"4/26 1 dead chick in nest" +2021,henry,157,greg,2021-03-22,3,,incubating,"4/26 1 dead chick in nest" +2021,henry,157,greg,2021-03-29,,2,nestling,"4/26 1 dead chick in nest" +2021,henry,157,greg,2021-04-05,,3,nestling,"4/26 1 dead chick in nest" +2021,henry,157,greg,2021-04-13,,3,nestling,"4/26 1 dead chick in nest" +2021,henry,157,greg,2021-04-19,,2,,"4/26 1 dead chick in nest" +2021,henry,157,greg,2021-04-26,,2,fledged,"4/26 1 dead chick in nest" +2021,henry,157,greg,2021-05-03,,,,"4/26 1 dead chick in nest" +2021,henry,153,greg,2021-02-09,,,, +2021,henry,153,greg,2021-02-15,,,, +2021,henry,153,greg,2021-02-22,,,, +2021,henry,153,greg,2021-03-01,3,,incubating, +2021,henry,153,greg,2021-03-08,,,missed, +2021,henry,153,greg,2021-03-15,,3,nestling, +2021,henry,153,greg,2021-03-22,,3,nestling, +2021,henry,153,greg,2021-03-29,,3,nestling, +2021,henry,153,greg,2021-04-05,,2,nestling, +2021,henry,153,greg,2021-04-13,,0,fledged, +2021,henry,153,greg,2021-04-19,,,, +2021,henry,153,greg,2021-04-26,,,, +2021,henry,153,greg,2021-05-03,,,, +2021,henry,168,greg,2021-02-09,,,,"relay on 3/15?, 1 dead chick" +2021,henry,168,greg,2021-02-15,,,,"relay on 3/15?, 1 dead chick" +2021,henry,168,greg,2021-02-22,,,,"relay on 3/15?, 1 dead chick" +2021,henry,168,greg,2021-03-01,3,,incubating,"relay on 3/15?, 1 dead chick" +2021,henry,168,greg,2021-03-08,0,,empty,"relay on 3/15?, 1 dead chick" +2021,henry,168,greg,2021-03-15,3,,incubating,"relay on 3/15?, 1 dead chick" +2021,henry,168,greg,2021-03-22,2,1,hatching,"relay on 3/15?, 1 dead chick" +2021,henry,168,greg,2021-03-29,,2,nestling,"relay on 3/15?, 1 dead chick" +2021,henry,168,greg,2021-04-05,,3,nestling,"relay on 3/15?, 1 dead chick" +2021,henry,168,greg,2021-04-13,,2,nestling,"relay on 3/15?, 1 dead chick" +2021,henry,168,greg,2021-04-19,,3,,"relay on 3/15?, 1 dead chick" +2021,henry,168,greg,2021-04-26,,1,fledged,"relay on 3/15?, 1 dead chick" +2021,henry,168,greg,2021-05-03,,,,"relay on 3/15?, 1 dead chick" +2021,henry,155,greg,2021-02-09,,,, +2021,henry,155,greg,2021-02-15,,,, +2021,henry,155,greg,2021-02-22,,,, +2021,henry,155,greg,2021-03-01,1,,incubating, +2021,henry,155,greg,2021-03-08,3,,incubating, +2021,henry,155,greg,2021-03-15,3,,incubating, +2021,henry,155,greg,2021-03-22,3,,incubating, +2021,henry,155,greg,2021-03-29,1,2,wet_chick, +2021,henry,155,greg,2021-04-05,,2,nestling, +2021,henry,155,greg,2021-04-13,,3,nestling, +2021,henry,155,greg,2021-04-19,,3,, +2021,henry,155,greg,2021-04-26,,2,fledged, +2021,henry,155,greg,2021-05-03,,,, +2021,henry,291,bcnh,2021-02-09,,,,"3/29 species changed from greg to bcnh 4/19 1+ chicks" +2021,henry,291,bcnh,2021-02-15,,,,"3/29 species changed from greg to bcnh 4/19 1+ chicks" +2021,henry,291,bcnh,2021-02-22,,,,"3/29 species changed from greg to bcnh 4/19 1+ chicks" +2021,henry,291,bcnh,2021-03-01,,,,"3/29 species changed from greg to bcnh 4/19 1+ chicks" +2021,henry,291,bcnh,2021-03-08,3,,incubating,"3/29 species changed from greg to bcnh 4/19 1+ chicks" +2021,henry,291,bcnh,2021-03-15,3,,incubating,"3/29 species changed from greg to bcnh 4/19 1+ chicks" +2021,henry,291,bcnh,2021-03-22,3,,incubating,"3/29 species changed from greg to bcnh 4/19 1+ chicks" +2021,henry,291,bcnh,2021-03-29,,2,nestling,"3/29 species changed from greg to bcnh 4/19 1+ chicks" +2021,henry,291,bcnh,2021-04-05,,3,nestling,"3/29 species changed from greg to bcnh 4/19 1+ chicks" +2021,henry,291,bcnh,2021-04-13,,2,nestling,"3/29 species changed from greg to bcnh 4/19 1+ chicks" +2021,henry,291,bcnh,2021-04-19,,1,,"3/29 species changed from greg to bcnh 4/19 1+ chicks" +2021,henry,291,bcnh,2021-04-26,,,,"3/29 species changed from greg to bcnh 4/19 1+ chicks" +2021,henry,291,bcnh,2021-05-03,,,,"3/29 species changed from greg to bcnh 4/19 1+ chicks" +2021,henry,293,greg,2021-02-09,,,,"4/5 possibly more than two chicks" +2021,henry,293,greg,2021-02-15,,,,"4/5 possibly more than two chicks" +2021,henry,293,greg,2021-02-22,,,,"4/5 possibly more than two chicks" +2021,henry,293,greg,2021-03-01,,,,"4/5 possibly more than two chicks" +2021,henry,293,greg,2021-03-08,2,2,hatching,"4/5 possibly more than two chicks" +2021,henry,293,greg,2021-03-15,,2,nestling,"4/5 possibly more than two chicks" +2021,henry,293,greg,2021-03-22,,3,nestling,"4/5 possibly more than two chicks" +2021,henry,293,greg,2021-03-29,,2,nestling,"4/5 possibly more than two chicks" +2021,henry,293,greg,2021-04-05,,2,nestling,"4/5 possibly more than two chicks" +2021,henry,293,greg,2021-04-13,,3,nestling,"4/5 possibly more than two chicks" +2021,henry,293,greg,2021-04-19,,0,fledged,"4/5 possibly more than two chicks" +2021,henry,293,greg,2021-04-26,,,,"4/5 possibly more than two chicks" +2021,henry,293,greg,2021-05-03,,,,"4/5 possibly more than two chicks" +2021,henry,295,greg,2021-02-09,,,,"BCNH?" +2021,henry,295,greg,2021-02-15,,,,"BCNH?" +2021,henry,295,greg,2021-02-22,,,,"BCNH?" +2021,henry,295,greg,2021-03-01,,,,"BCNH?" +2021,henry,295,greg,2021-03-08,2,,incubating,"BCNH?" +2021,henry,295,greg,2021-03-15,2,,incubating,"BCNH?" +2021,henry,295,greg,2021-03-22,2,,incubating,"BCNH?" +2021,henry,295,greg,2021-03-29,,2,nestling,"BCNH?" +2021,henry,295,greg,2021-04-05,,2,nestling,"BCNH?" +2021,henry,295,greg,2021-04-13,,2,nestling,"BCNH?" +2021,henry,295,greg,2021-04-19,,2,,"BCNH?" +2021,henry,295,greg,2021-04-26,,,,"BCNH?" +2021,henry,295,greg,2021-05-03,,,,"BCNH?" +2021,henry,297,greg,2021-02-09,,,, +2021,henry,297,greg,2021-02-15,,,, +2021,henry,297,greg,2021-02-22,,,, +2021,henry,297,greg,2021-03-01,,,, +2021,henry,297,greg,2021-03-08,4,,incubating, +2021,henry,297,greg,2021-03-15,3,,incubating, +2021,henry,297,greg,2021-03-22,3,1,wet_chick, +2021,henry,297,greg,2021-03-29,,3,nestling, +2021,henry,297,greg,2021-04-05,,2,nestling, +2021,henry,297,greg,2021-04-13,,2,nestling, +2021,henry,297,greg,2021-04-19,,2,, +2021,henry,297,greg,2021-04-26,,0,fledged, +2021,henry,297,greg,2021-05-03,,,, +2021,henry,244,greg,2021-02-09,,,, +2021,henry,244,greg,2021-02-15,,,, +2021,henry,244,greg,2021-02-22,,,, +2021,henry,244,greg,2021-03-01,,,, +2021,henry,244,greg,2021-03-08,3,,incubating, +2021,henry,244,greg,2021-03-15,3,,incubating, +2021,henry,244,greg,2021-03-22,3,,incubating, +2021,henry,244,greg,2021-03-29,,2,nestling, +2021,henry,244,greg,2021-04-05,,2,nestling, +2021,henry,244,greg,2021-04-13,,2,nestling, +2021,henry,244,greg,2021-04-19,,0,fledged, +2021,henry,244,greg,2021-04-26,,,, +2021,henry,244,greg,2021-05-03,,,, +2021,henry,299,rosp,2021-02-09,,,, +2021,henry,299,rosp,2021-02-15,,,, +2021,henry,299,rosp,2021-02-22,,,, +2021,henry,299,rosp,2021-03-01,,,, +2021,henry,299,rosp,2021-03-08,3,,incubating, +2021,henry,299,rosp,2021-03-15,4,,incubating, +2021,henry,299,rosp,2021-03-22,4,,incubating, +2021,henry,299,rosp,2021-03-29,4,,incubating, +2021,henry,299,rosp,2021-04-05,3,,incubating, +2021,henry,299,rosp,2021-04-13,2,,incubating, +2021,henry,299,rosp,2021-04-19,2,,incubating, +2021,henry,299,rosp,2021-04-26,1,,incubating, +2021,henry,299,rosp,2021-05-03,1,,incubating, +2021,henry,301,rosp,2021-02-09,,,, +2021,henry,301,rosp,2021-02-15,,,, +2021,henry,301,rosp,2021-02-22,,,, +2021,henry,301,rosp,2021-03-01,,,, +2021,henry,301,rosp,2021-03-08,2,,incubating, +2021,henry,301,rosp,2021-03-15,3,,incubating, +2021,henry,301,rosp,2021-03-22,3,,incubating, +2021,henry,301,rosp,2021-03-29,,,missed, +2021,henry,301,rosp,2021-04-05,,3,nestling, +2021,henry,301,rosp,2021-04-13,,3,nestling, +2021,henry,301,rosp,2021-04-19,,1,, +2021,henry,301,rosp,2021-04-26,,1,nestling, +2021,henry,301,rosp,2021-05-03,,1,fledged, +2021,henry,303,greg,2021-02-09,,,, +2021,henry,303,greg,2021-02-15,,,, +2021,henry,303,greg,2021-02-22,,,, +2021,henry,303,greg,2021-03-01,,,, +2021,henry,303,greg,2021-03-08,1,,incubating, +2021,henry,303,greg,2021-03-15,3,,incubating, +2021,henry,303,greg,2021-03-22,3,,incubating, +2021,henry,303,greg,2021-03-29,3,,incubating, +2021,henry,303,greg,2021-04-05,2,2,hatching, +2021,henry,303,greg,2021-04-13,,3,nestling, +2021,henry,303,greg,2021-04-19,,3,, +2021,henry,303,greg,2021-04-26,,3,nestling, +2021,henry,303,greg,2021-05-03,,2,fledged, +2021,henry,305,rosp,2021-02-09,,,, +2021,henry,305,rosp,2021-02-15,,,, +2021,henry,305,rosp,2021-02-22,,,, +2021,henry,305,rosp,2021-03-01,,,, +2021,henry,305,rosp,2021-03-08,2,,incubating, +2021,henry,305,rosp,2021-03-15,3,,incubating, +2021,henry,305,rosp,2021-03-22,3,,incubating, +2021,henry,305,rosp,2021-03-29,3,,incubating, +2021,henry,305,rosp,2021-04-05,1,2,hatching, +2021,henry,305,rosp,2021-04-13,,2,nestling, +2021,henry,305,rosp,2021-04-19,,2,, +2021,henry,305,rosp,2021-04-26,,1,fledged, +2021,henry,305,rosp,2021-05-03,,1,fledged, +2021,henry,307,greg,2021-02-09,,,,"3/25: 1 egg pipping in addtion to wet chick" +2021,henry,307,greg,2021-02-15,,,,"3/25: 1 egg pipping in addtion to wet chick" +2021,henry,307,greg,2021-02-22,,,,"3/25: 1 egg pipping in addtion to wet chick" +2021,henry,307,greg,2021-03-01,,,,"3/25: 1 egg pipping in addtion to wet chick" +2021,henry,307,greg,2021-03-08,4,,incubating,"3/25: 1 egg pipping in addtion to wet chick" +2021,henry,307,greg,2021-03-15,4,,incubating,"3/25: 1 egg pipping in addtion to wet chick" +2021,henry,307,greg,2021-03-22,3,1,wet_chick,"3/25: 1 egg pipping in addtion to wet chick" +2021,henry,307,greg,2021-03-29,,4,nestling,"3/25: 1 egg pipping in addtion to wet chick" +2021,henry,307,greg,2021-04-05,,4,nestling,"3/25: 1 egg pipping in addtion to wet chick" +2021,henry,307,greg,2021-04-13,,4,nestling,"3/25: 1 egg pipping in addtion to wet chick" +2021,henry,307,greg,2021-04-19,,3,,"3/25: 1 egg pipping in addtion to wet chick" +2021,henry,307,greg,2021-04-26,,3,fledged,"3/25: 1 egg pipping in addtion to wet chick" +2021,henry,307,greg,2021-05-03,,,,"3/25: 1 egg pipping in addtion to wet chick" +2021,henry,510,greg,2021-02-09,,,, +2021,henry,510,greg,2021-02-15,,,, +2021,henry,510,greg,2021-02-22,,,, +2021,henry,510,greg,2021-03-01,,,, +2021,henry,510,greg,2021-03-08,,,, +2021,henry,510,greg,2021-03-15,2,,incubating, +2021,henry,510,greg,2021-03-22,3,,incubating, +2021,henry,510,greg,2021-03-29,3,,incubating, +2021,henry,510,greg,2021-04-05,3,,incubating, +2021,henry,510,greg,2021-04-13,,1,nestling, +2021,henry,510,greg,2021-04-19,,1,, +2021,henry,510,greg,2021-04-26,,2,nestling, +2021,henry,510,greg,2021-05-03,,2,nestling, +2021,henry,254,greg,2021-02-09,,,, +2021,henry,254,greg,2021-02-15,,,, +2021,henry,254,greg,2021-02-22,,,, +2021,henry,254,greg,2021-03-01,,,, +2021,henry,254,greg,2021-03-08,,,, +2021,henry,254,greg,2021-03-15,2,,incubating, +2021,henry,254,greg,2021-03-22,3,,incubating, +2021,henry,254,greg,2021-03-29,3,,incubating, +2021,henry,254,greg,2021-04-05,3,,incubating, +2021,henry,254,greg,2021-04-13,,2,nestling, +2021,henry,254,greg,2021-04-19,,1,, +2021,henry,254,greg,2021-04-26,,2,nestling, +2021,henry,254,greg,2021-05-03,,2,nestling, +2021,henry,512,greg,2021-02-09,,,,"4/5 collapsed" +2021,henry,512,greg,2021-02-15,,,,"4/5 collapsed" +2021,henry,512,greg,2021-02-22,,,,"4/5 collapsed" +2021,henry,512,greg,2021-03-01,,,,"4/5 collapsed" +2021,henry,512,greg,2021-03-08,,,,"4/5 collapsed" +2021,henry,512,greg,2021-03-15,2,,incubating,"4/5 collapsed" +2021,henry,512,greg,2021-03-22,2,,incubating,"4/5 collapsed" +2021,henry,512,greg,2021-03-29,2,,incubating,"4/5 collapsed" +2021,henry,512,greg,2021-04-05,,0,empty,"4/5 collapsed" +2021,henry,512,greg,2021-04-13,,,,"4/5 collapsed" +2021,henry,512,greg,2021-04-19,,,,"4/5 collapsed" +2021,henry,512,greg,2021-04-26,,,,"4/5 collapsed" +2021,henry,512,greg,2021-05-03,,,,"4/5 collapsed" +2021,henry,514,greg,2021-02-09,,,,"4/26 1 dead chick" +2021,henry,514,greg,2021-02-15,,,,"4/26 1 dead chick" +2021,henry,514,greg,2021-02-22,,,,"4/26 1 dead chick" +2021,henry,514,greg,2021-03-01,,,,"4/26 1 dead chick" +2021,henry,514,greg,2021-03-08,,,,"4/26 1 dead chick" +2021,henry,514,greg,2021-03-15,2,,incubating,"4/26 1 dead chick" +2021,henry,514,greg,2021-03-22,3,,incubating,"4/26 1 dead chick" +2021,henry,514,greg,2021-03-29,3,,incubating,"4/26 1 dead chick" +2021,henry,514,greg,2021-04-05,3,,incubating,"4/26 1 dead chick" +2021,henry,514,greg,2021-04-13,,3,nestling,"4/26 1 dead chick" +2021,henry,514,greg,2021-04-19,,3,,"4/26 1 dead chick" +2021,henry,514,greg,2021-04-26,,2,nestling,"4/26 1 dead chick" +2021,henry,514,greg,2021-05-03,,1,nestling,"4/26 1 dead chick" +2021,henry,256,greg,2021-02-09,,,, +2021,henry,256,greg,2021-02-15,,,, +2021,henry,256,greg,2021-02-22,,,, +2021,henry,256,greg,2021-03-01,,,, +2021,henry,256,greg,2021-03-08,,,, +2021,henry,256,greg,2021-03-15,3,,incubating, +2021,henry,256,greg,2021-03-22,2,1,hatching, +2021,henry,256,greg,2021-03-29,1,2,hatching, +2021,henry,256,greg,2021-04-05,,2,nestling, +2021,henry,256,greg,2021-04-13,,2,nestling, +2021,henry,256,greg,2021-04-19,,2,, +2021,henry,256,greg,2021-04-26,,0,fledged, +2021,henry,256,greg,2021-05-03,,,, +2021,henry,258,greg,2021-02-09,,,,"4/5 collapsed" +2021,henry,258,greg,2021-02-15,,,,"4/5 collapsed" +2021,henry,258,greg,2021-02-22,,,,"4/5 collapsed" +2021,henry,258,greg,2021-03-01,,,,"4/5 collapsed" +2021,henry,258,greg,2021-03-08,,,,"4/5 collapsed" +2021,henry,258,greg,2021-03-15,3,,incubating,"4/5 collapsed" +2021,henry,258,greg,2021-03-22,3,,incubating,"4/5 collapsed" +2021,henry,258,greg,2021-03-29,3,,incubating,"4/5 collapsed" +2021,henry,258,greg,2021-04-05,,0,empty,"4/5 collapsed" +2021,henry,258,greg,2021-04-13,,,,"4/5 collapsed" +2021,henry,258,greg,2021-04-19,,,,"4/5 collapsed" +2021,henry,258,greg,2021-04-26,,,,"4/5 collapsed" +2021,henry,258,greg,2021-05-03,,,,"4/5 collapsed" +2021,henry,260,greg,2021-02-09,,,,"5/3 sampled for mercury" +2021,henry,260,greg,2021-02-15,,,,"5/3 sampled for mercury" +2021,henry,260,greg,2021-02-22,,,,"5/3 sampled for mercury" +2021,henry,260,greg,2021-03-01,,,,"5/3 sampled for mercury" +2021,henry,260,greg,2021-03-08,,,,"5/3 sampled for mercury" +2021,henry,260,greg,2021-03-15,3,,incubating,"5/3 sampled for mercury" +2021,henry,260,greg,2021-03-22,3,,incubating,"5/3 sampled for mercury" +2021,henry,260,greg,2021-03-29,2,,incubating,"5/3 sampled for mercury" +2021,henry,260,greg,2021-04-05,,2,nestling,"5/3 sampled for mercury" +2021,henry,260,greg,2021-04-13,,2,nestling,"5/3 sampled for mercury" +2021,henry,260,greg,2021-04-19,,2,,"5/3 sampled for mercury" +2021,henry,260,greg,2021-04-26,,2,nestling,"5/3 sampled for mercury" +2021,henry,260,greg,2021-05-03,,2,fledged,"5/3 sampled for mercury" +2021,henry,262,greg,2021-02-09,,,, +2021,henry,262,greg,2021-02-15,,,, +2021,henry,262,greg,2021-02-22,,,, +2021,henry,262,greg,2021-03-01,,,, +2021,henry,262,greg,2021-03-08,,,, +2021,henry,262,greg,2021-03-15,3,,incubating, +2021,henry,262,greg,2021-03-22,3,,incubating, +2021,henry,262,greg,2021-03-29,,,missed, +2021,henry,262,greg,2021-04-05,,,missed, +2021,henry,262,greg,2021-04-13,,,missed, +2021,henry,262,greg,2021-04-19,,,missed, +2021,henry,262,greg,2021-04-26,,,, +2021,henry,262,greg,2021-05-03,,,, +2021,henry,516,greg,2021-02-09,,,, +2021,henry,516,greg,2021-02-15,,,, +2021,henry,516,greg,2021-02-22,,,, +2021,henry,516,greg,2021-03-01,,,, +2021,henry,516,greg,2021-03-08,,,, +2021,henry,516,greg,2021-03-15,3,,incubating, +2021,henry,516,greg,2021-03-22,3,,incubating, +2021,henry,516,greg,2021-03-29,3,,incubating, +2021,henry,516,greg,2021-04-05,1,2,hatching, +2021,henry,516,greg,2021-04-13,,2,nestling, +2021,henry,516,greg,2021-04-19,,2,, +2021,henry,516,greg,2021-04-26,,2,nestling, +2021,henry,516,greg,2021-05-03,,2,nestling, +2021,henry,518,greg,2021-02-09,,,, +2021,henry,518,greg,2021-02-15,,,, +2021,henry,518,greg,2021-02-22,,,, +2021,henry,518,greg,2021-03-01,,,, +2021,henry,518,greg,2021-03-08,,,, +2021,henry,518,greg,2021-03-15,6,,incubating, +2021,henry,518,greg,2021-03-22,6,,incubating, +2021,henry,518,greg,2021-03-29,6,,incubating, +2021,henry,518,greg,2021-04-05,6,,incubating, +2021,henry,518,greg,2021-04-13,,5,nestling, +2021,henry,518,greg,2021-04-19,,6,, +2021,henry,518,greg,2021-04-26,,4,nestling, +2021,henry,518,greg,2021-05-03,,3,nestling, +2021,henry,334,bcnh,2021-02-09,,,,"3/25 new nest" +2021,henry,334,bcnh,2021-02-15,,,,"3/25 new nest" +2021,henry,334,bcnh,2021-02-22,,,,"3/25 new nest" +2021,henry,334,bcnh,2021-03-01,,,,"3/25 new nest" +2021,henry,334,bcnh,2021-03-08,,,,"3/25 new nest" +2021,henry,334,bcnh,2021-03-15,,,,"3/25 new nest" +2021,henry,334,bcnh,2021-03-22,1,,incubating,"3/25 new nest" +2021,henry,334,bcnh,2021-03-29,3,,incubating,"3/25 new nest" +2021,henry,334,bcnh,2021-04-05,3,,incubating,"3/25 new nest" +2021,henry,334,bcnh,2021-04-13,1,2,hatching,"3/25 new nest" +2021,henry,334,bcnh,2021-04-19,,3,,"3/25 new nest" +2021,henry,334,bcnh,2021-04-26,,2,nestling,"3/25 new nest" +2021,henry,334,bcnh,2021-05-03,,2,nestling,"3/25 new nest" +2021,henry,384,bcnh,2021-02-09,,,, +2021,henry,384,bcnh,2021-02-15,,,, +2021,henry,384,bcnh,2021-02-22,,,, +2021,henry,384,bcnh,2021-03-01,,,, +2021,henry,384,bcnh,2021-03-08,,,, +2021,henry,384,bcnh,2021-03-15,,,, +2021,henry,384,bcnh,2021-03-22,,,, +2021,henry,384,bcnh,2021-03-29,,,, +2021,henry,384,bcnh,2021-04-05,4,,incubating, +2021,henry,384,bcnh,2021-04-13,3,1,hatching, +2021,henry,384,bcnh,2021-04-19,,2,, +2021,henry,384,bcnh,2021-04-26,,2,nestling, +2021,henry,384,bcnh,2021-05-03,,2,nestling, +2021,henry,356,greg,2021-02-09,,,, +2021,henry,356,greg,2021-02-15,,,, +2021,henry,356,greg,2021-02-22,,,, +2021,henry,356,greg,2021-03-01,,,, +2021,henry,356,greg,2021-03-08,,,, +2021,henry,356,greg,2021-03-15,,,, +2021,henry,356,greg,2021-03-22,,,, +2021,henry,356,greg,2021-03-29,,,, +2021,henry,356,greg,2021-04-05,,,, +2021,henry,356,greg,2021-04-13,3,,incubating, +2021,henry,356,greg,2021-04-19,3,,, +2021,henry,356,greg,2021-04-26,1,,incubating, +2021,henry,356,greg,2021-05-03,1,,incubating, +2021,jetport_south,264,wost,2021-03-10,2,,incubating,"4/5 orange drone flagging" +2021,jetport_south,264,wost,2021-03-15,3,,incubating,"4/5 orange drone flagging" +2021,jetport_south,264,wost,2021-03-22,3,,incubating,"4/5 orange drone flagging" +2021,jetport_south,264,wost,2021-03-29,3,,incubating,"4/5 orange drone flagging" +2021,jetport_south,264,wost,2021-04-05,2,1,hatching,"4/5 orange drone flagging" +2021,jetport_south,264,wost,2021-04-13,,3,nestling,"4/5 orange drone flagging" +2021,jetport_south,264,wost,2021-04-19,,3,nestling,"4/5 orange drone flagging" +2021,jetport_south,264,wost,2021-04-26,,2,nestling,"4/5 orange drone flagging" +2021,jetport_south,264,wost,2021-05-03,,2,nestling,"4/5 orange drone flagging" +2021,jetport_south,264,wost,2021-05-10,,2,nestling,"4/5 orange drone flagging" +2021,jetport_south,264,wost,2021-05-17,,2,nestling,"4/5 orange drone flagging" +2021,jetport_south,264,wost,2021-05-25,,2,nestling,"4/5 orange drone flagging" +2021,jetport_south,264,wost,2021-05-31,,0,fledged,"4/5 orange drone flagging" +2021,jetport_south,264,wost,2021-06-07,,0,,"4/5 orange drone flagging" +2021,jetport_south,266,wost,2021-03-10,2,,incubating,"4/5 orange drone flagging 5/10 2+ chicks" +2021,jetport_south,266,wost,2021-03-15,3,,incubating,"4/5 orange drone flagging 5/10 2+ chicks" +2021,jetport_south,266,wost,2021-03-22,3,,incubating,"4/5 orange drone flagging 5/10 2+ chicks" +2021,jetport_south,266,wost,2021-03-29,3,,incubating,"4/5 orange drone flagging 5/10 2+ chicks" +2021,jetport_south,266,wost,2021-04-05,3,,incubating,"4/5 orange drone flagging 5/10 2+ chicks" +2021,jetport_south,266,wost,2021-04-13,,3,nestling,"4/5 orange drone flagging 5/10 2+ chicks" +2021,jetport_south,266,wost,2021-04-19,,3,nestling,"4/5 orange drone flagging 5/10 2+ chicks" +2021,jetport_south,266,wost,2021-04-26,,3,nestling,"4/5 orange drone flagging 5/10 2+ chicks" +2021,jetport_south,266,wost,2021-05-03,,3,nestling,"4/5 orange drone flagging 5/10 2+ chicks" +2021,jetport_south,266,wost,2021-05-10,,2,nestling,"4/5 orange drone flagging 5/10 2+ chicks" +2021,jetport_south,266,wost,2021-05-17,,3,nestling,"4/5 orange drone flagging 5/10 2+ chicks" +2021,jetport_south,266,wost,2021-05-25,,3,fledged,"4/5 orange drone flagging 5/10 2+ chicks" +2021,jetport_south,266,wost,2021-05-31,,0,fledged,"4/5 orange drone flagging 5/10 2+ chicks" +2021,jetport_south,266,wost,2021-06-07,,0,,"4/5 orange drone flagging 5/10 2+ chicks" +2021,jetport_south,268,wost,2021-03-10,3,,incubating,"4/5 Large amount of nests missed due to anhinga jumpers; 5/3: all drone flags removed from previous week" +2021,jetport_south,268,wost,2021-03-15,3,,incubating,"4/5 Large amount of nests missed due to anhinga jumpers; 5/3: all drone flags removed from previous week" +2021,jetport_south,268,wost,2021-03-22,3,,incubating,"4/5 Large amount of nests missed due to anhinga jumpers; 5/3: all drone flags removed from previous week" +2021,jetport_south,268,wost,2021-03-29,3,,incubating,"4/5 Large amount of nests missed due to anhinga jumpers; 5/3: all drone flags removed from previous week" +2021,jetport_south,268,wost,2021-04-05,,,missed,"4/5 Large amount of nests missed due to anhinga jumpers; 5/3: all drone flags removed from previous week" +2021,jetport_south,268,wost,2021-04-13,,3,nestling,"4/5 Large amount of nests missed due to anhinga jumpers; 5/3: all drone flags removed from previous week" +2021,jetport_south,268,wost,2021-04-19,,3,nestling,"4/5 Large amount of nests missed due to anhinga jumpers; 5/3: all drone flags removed from previous week" +2021,jetport_south,268,wost,2021-04-26,,2,nestling,"4/5 Large amount of nests missed due to anhinga jumpers; 5/3: all drone flags removed from previous week" +2021,jetport_south,268,wost,2021-05-03,,2,nestling,"4/5 Large amount of nests missed due to anhinga jumpers; 5/3: all drone flags removed from previous week" +2021,jetport_south,268,wost,2021-05-10,,2,nestling,"4/5 Large amount of nests missed due to anhinga jumpers; 5/3: all drone flags removed from previous week" +2021,jetport_south,268,wost,2021-05-17,,3,nestling,"4/5 Large amount of nests missed due to anhinga jumpers; 5/3: all drone flags removed from previous week" +2021,jetport_south,268,wost,2021-05-25,,3,nestling,"4/5 Large amount of nests missed due to anhinga jumpers; 5/3: all drone flags removed from previous week" +2021,jetport_south,268,wost,2021-05-31,,3,fledged,"4/5 Large amount of nests missed due to anhinga jumpers; 5/3: all drone flags removed from previous week" +2021,jetport_south,268,wost,2021-06-07,,0,,"4/5 Large amount of nests missed due to anhinga jumpers; 5/3: all drone flags removed from previous week" +2021,jetport_south,270,wost,2021-03-10,2,,incubating,"5/31 2+ chicks" +2021,jetport_south,270,wost,2021-03-15,2,,incubating,"5/31 2+ chicks" +2021,jetport_south,270,wost,2021-03-22,2,,incubating,"5/31 2+ chicks" +2021,jetport_south,270,wost,2021-03-29,2,,incubating,"5/31 2+ chicks" +2021,jetport_south,270,wost,2021-04-05,,,missed,"5/31 2+ chicks" +2021,jetport_south,270,wost,2021-04-13,,2,nestling,"5/31 2+ chicks" +2021,jetport_south,270,wost,2021-04-19,,2,nestling,"5/31 2+ chicks" +2021,jetport_south,270,wost,2021-04-26,,2,nestling,"5/31 2+ chicks" +2021,jetport_south,270,wost,2021-05-03,,2,nestling,"5/31 2+ chicks" +2021,jetport_south,270,wost,2021-05-10,,2,nestling,"5/31 2+ chicks" +2021,jetport_south,270,wost,2021-05-17,,2,nestling,"5/31 2+ chicks" +2021,jetport_south,270,wost,2021-05-25,,0,empty,"5/31 2+ chicks" +2021,jetport_south,270,wost,2021-05-31,,2,nestling,"5/31 2+ chicks" +2021,jetport_south,270,wost,2021-06-07,,0,,"5/31 2+ chicks" +2021,jetport_south,534,wost,2021-03-10,0,0,pre_flagged, +2021,jetport_south,534,wost,2021-03-15,0,0,pre_flagged, +2021,jetport_south,534,wost,2021-03-22,4,,incubating, +2021,jetport_south,534,wost,2021-03-29,4,,incubating, +2021,jetport_south,534,wost,2021-04-05,,,missed, +2021,jetport_south,534,wost,2021-04-13,2,1,wet_chick, +2021,jetport_south,534,wost,2021-04-19,,3,nestling, +2021,jetport_south,534,wost,2021-04-26,,4,nestling, +2021,jetport_south,534,wost,2021-05-03,,3,nestling, +2021,jetport_south,534,wost,2021-05-10,,3,nestling, +2021,jetport_south,534,wost,2021-05-17,,3,nestling, +2021,jetport_south,534,wost,2021-05-25,,3,nestling, +2021,jetport_south,534,wost,2021-05-31,,2,nestling, +2021,jetport_south,534,wost,2021-06-07,,2,nestling, +2021,jetport_south,272,wost,2021-03-10,2,,incubating,"5/10 2 + chicks" +2021,jetport_south,272,wost,2021-03-15,0,,empty,"5/10 2 + chicks" +2021,jetport_south,272,wost,2021-03-22,4,,incubating,"5/10 2 + chicks" +2021,jetport_south,272,wost,2021-03-29,4,,incubating,"5/10 2 + chicks" +2021,jetport_south,272,wost,2021-04-05,,,missed,"5/10 2 + chicks" +2021,jetport_south,272,wost,2021-04-13,3,1,hatching,"5/10 2 + chicks" +2021,jetport_south,272,wost,2021-04-19,,4,nestling,"5/10 2 + chicks" +2021,jetport_south,272,wost,2021-04-26,,3,nestling,"5/10 2 + chicks" +2021,jetport_south,272,wost,2021-05-03,,3,nestling,"5/10 2 + chicks" +2021,jetport_south,272,wost,2021-05-10,,2,nestling,"5/10 2 + chicks" +2021,jetport_south,272,wost,2021-05-17,,3,nestling,"5/10 2 + chicks" +2021,jetport_south,272,wost,2021-05-25,,2,fledged,"5/10 2 + chicks" +2021,jetport_south,272,wost,2021-05-31,,3,nestling,"5/10 2 + chicks" +2021,jetport_south,272,wost,2021-06-07,,1,nestling,"5/10 2 + chicks" +2021,jetport_south,274,wost,2021-03-10,3,,incubating,"5/25 fledged" +2021,jetport_south,274,wost,2021-03-15,3,,incubating,"5/25 fledged" +2021,jetport_south,274,wost,2021-03-22,3,,incubating,"5/25 fledged" +2021,jetport_south,274,wost,2021-03-29,3,,incubating,"5/25 fledged" +2021,jetport_south,274,wost,2021-04-05,,,missed,"5/25 fledged" +2021,jetport_south,274,wost,2021-04-13,,3,nestling,"5/25 fledged" +2021,jetport_south,274,wost,2021-04-19,,3,nestling,"5/25 fledged" +2021,jetport_south,274,wost,2021-04-26,,3,nestling,"5/25 fledged" +2021,jetport_south,274,wost,2021-05-03,,3,nestling,"5/25 fledged" +2021,jetport_south,274,wost,2021-05-10,,3,nestling,"5/25 fledged" +2021,jetport_south,274,wost,2021-05-17,,3,nestling,"5/25 fledged" +2021,jetport_south,274,wost,2021-05-25,,0,empty,"5/25 fledged" +2021,jetport_south,274,wost,2021-05-31,,,,"5/25 fledged" +2021,jetport_south,274,wost,2021-06-07,,,,"5/25 fledged" +2021,jetport_south,276,wost,2021-03-10,2,,incubating,"5/10 2 + chicks" +2021,jetport_south,276,wost,2021-03-15,3,,incubating,"5/10 2 + chicks" +2021,jetport_south,276,wost,2021-03-22,3,,incubating,"5/10 2 + chicks" +2021,jetport_south,276,wost,2021-03-29,3,,incubating,"5/10 2 + chicks" +2021,jetport_south,276,wost,2021-04-05,,,missed,"5/10 2 + chicks" +2021,jetport_south,276,wost,2021-04-13,,3,nestling,"5/10 2 + chicks" +2021,jetport_south,276,wost,2021-04-19,,2,nestling,"5/10 2 + chicks" +2021,jetport_south,276,wost,2021-04-26,,3,nestling,"5/10 2 + chicks" +2021,jetport_south,276,wost,2021-05-03,,3,nestling,"5/10 2 + chicks" +2021,jetport_south,276,wost,2021-05-10,,2,nestling,"5/10 2 + chicks" +2021,jetport_south,276,wost,2021-05-17,,3,nestling,"5/10 2 + chicks" +2021,jetport_south,276,wost,2021-05-25,,3,fledged,"5/10 2 + chicks" +2021,jetport_south,276,wost,2021-05-31,,0,fledged,"5/10 2 + chicks" +2021,jetport_south,276,wost,2021-06-07,,0,,"5/10 2 + chicks" +2021,jetport_south,278,wost,2021-03-10,3,,incubating,"4/13 1+ chick; 5/3: orangedrone flag" +2021,jetport_south,278,wost,2021-03-15,3,,incubating,"4/13 1+ chick; 5/3: orangedrone flag" +2021,jetport_south,278,wost,2021-03-22,3,,incubating,"4/13 1+ chick; 5/3: orangedrone flag" +2021,jetport_south,278,wost,2021-03-29,2,,incubating,"4/13 1+ chick; 5/3: orangedrone flag" +2021,jetport_south,278,wost,2021-04-05,,,missed,"4/13 1+ chick; 5/3: orangedrone flag" +2021,jetport_south,278,wost,2021-04-13,,1,nestling,"4/13 1+ chick; 5/3: orangedrone flag" +2021,jetport_south,278,wost,2021-04-19,,2,nestling,"4/13 1+ chick; 5/3: orangedrone flag" +2021,jetport_south,278,wost,2021-04-26,,2,nestling,"4/13 1+ chick; 5/3: orangedrone flag" +2021,jetport_south,278,wost,2021-05-03,,3,nestling,"4/13 1+ chick; 5/3: orangedrone flag" +2021,jetport_south,278,wost,2021-05-10,,3,nestling,"4/13 1+ chick; 5/3: orangedrone flag" +2021,jetport_south,278,wost,2021-05-17,,3,nestling,"4/13 1+ chick; 5/3: orangedrone flag" +2021,jetport_south,278,wost,2021-05-25,,3,fledged,"4/13 1+ chick; 5/3: orangedrone flag" +2021,jetport_south,278,wost,2021-05-31,,0,fledged,"4/13 1+ chick; 5/3: orangedrone flag" +2021,jetport_south,278,wost,2021-06-07,,0,,"4/13 1+ chick; 5/3: orangedrone flag" +2021,jetport_south,280,wost,2021-03-10,0,0,pre_flagged,"5/3: orange drone flag" +2021,jetport_south,280,wost,2021-03-15,0,0,pre_flagged,"5/3: orange drone flag" +2021,jetport_south,280,wost,2021-03-22,2,,incubating,"5/3: orange drone flag" +2021,jetport_south,280,wost,2021-03-29,3,,incubating,"5/3: orange drone flag" +2021,jetport_south,280,wost,2021-04-05,,,missed,"5/3: orange drone flag" +2021,jetport_south,280,wost,2021-04-13,,3,nestling,"5/3: orange drone flag" +2021,jetport_south,280,wost,2021-04-19,,2,nestling,"5/3: orange drone flag" +2021,jetport_south,280,wost,2021-04-26,,2,nestling,"5/3: orange drone flag" +2021,jetport_south,280,wost,2021-05-03,,2,nestling,"5/3: orange drone flag" +2021,jetport_south,280,wost,2021-05-10,,2,nestling,"5/3: orange drone flag" +2021,jetport_south,280,wost,2021-05-17,,2,nestling,"5/3: orange drone flag" +2021,jetport_south,280,wost,2021-05-25,,2,fledged,"5/3: orange drone flag" +2021,jetport_south,280,wost,2021-05-31,,0,fledged,"5/3: orange drone flag" +2021,jetport_south,280,wost,2021-06-07,,0,,"5/3: orange drone flag" +2021,jetport_south,348,wost,2021-03-10,,,,"6/7: blue drone flag" +2021,jetport_south,348,wost,2021-03-15,,,,"6/7: blue drone flag" +2021,jetport_south,348,wost,2021-03-22,,,,"6/7: blue drone flag" +2021,jetport_south,348,wost,2021-03-29,,,,"6/7: blue drone flag" +2021,jetport_south,348,wost,2021-04-05,,,,"6/7: blue drone flag" +2021,jetport_south,348,wost,2021-04-13,2,,incubating,"6/7: blue drone flag" +2021,jetport_south,348,wost,2021-04-19,2,,incubating,"6/7: blue drone flag" +2021,jetport_south,348,wost,2021-04-26,2,,incubating,"6/7: blue drone flag" +2021,jetport_south,348,wost,2021-05-03,,2,nestling,"6/7: blue drone flag" +2021,jetport_south,348,wost,2021-05-10,,2,nestling,"6/7: blue drone flag" +2021,jetport_south,348,wost,2021-05-17,,2,nestling,"6/7: blue drone flag" +2021,jetport_south,348,wost,2021-05-25,,2,fledged,"6/7: blue drone flag" +2021,jetport_south,348,wost,2021-05-31,,2,nestling,"6/7: blue drone flag" +2021,jetport_south,348,wost,2021-06-07,,0,,"6/7: blue drone flag" +2021,jetport_south,350,wost,2021-03-10,,,,"5/10 nest collapsed" +2021,jetport_south,350,wost,2021-03-15,,,,"5/10 nest collapsed" +2021,jetport_south,350,wost,2021-03-22,,,,"5/10 nest collapsed" +2021,jetport_south,350,wost,2021-03-29,,,,"5/10 nest collapsed" +2021,jetport_south,350,wost,2021-04-05,,,,"5/10 nest collapsed" +2021,jetport_south,350,wost,2021-04-13,2,,incubating,"5/10 nest collapsed" +2021,jetport_south,350,wost,2021-04-19,2,,incubating,"5/10 nest collapsed" +2021,jetport_south,350,wost,2021-04-26,3,,incubating,"5/10 nest collapsed" +2021,jetport_south,350,wost,2021-05-03,,,missed,"5/10 nest collapsed" +2021,jetport_south,350,wost,2021-05-10,,0,empty,"5/10 nest collapsed" +2021,jetport_south,350,wost,2021-05-17,,,,"5/10 nest collapsed" +2021,jetport_south,350,wost,2021-05-25,,,,"5/10 nest collapsed" +2021,jetport_south,350,wost,2021-05-31,,,,"5/10 nest collapsed" +2021,jetport_south,350,wost,2021-06-07,,,,"5/10 nest collapsed" +2021,jetport_south,282,wost,2021-03-10,3,,incubating,"5/3 orange drone flag 5/10 2+ chicks" +2021,jetport_south,282,wost,2021-03-15,4,,incubating,"5/3 orange drone flag 5/10 2+ chicks" +2021,jetport_south,282,wost,2021-03-22,4,,incubating,"5/3 orange drone flag 5/10 2+ chicks" +2021,jetport_south,282,wost,2021-03-29,3,,incubating,"5/3 orange drone flag 5/10 2+ chicks" +2021,jetport_south,282,wost,2021-04-05,,,missed,"5/3 orange drone flag 5/10 2+ chicks" +2021,jetport_south,282,wost,2021-04-13,,3,nestling,"5/3 orange drone flag 5/10 2+ chicks" +2021,jetport_south,282,wost,2021-04-19,,3,nestling,"5/3 orange drone flag 5/10 2+ chicks" +2021,jetport_south,282,wost,2021-04-26,,4,nestling,"5/3 orange drone flag 5/10 2+ chicks" +2021,jetport_south,282,wost,2021-05-03,,3,nestling,"5/3 orange drone flag 5/10 2+ chicks" +2021,jetport_south,282,wost,2021-05-10,,2,nestling,"5/3 orange drone flag 5/10 2+ chicks" +2021,jetport_south,282,wost,2021-05-17,,3,nestling,"5/3 orange drone flag 5/10 2+ chicks" +2021,jetport_south,282,wost,2021-05-25,,3,fledged,"5/3 orange drone flag 5/10 2+ chicks" +2021,jetport_south,282,wost,2021-05-31,,0,fledged,"5/3 orange drone flag 5/10 2+ chicks" +2021,jetport_south,282,wost,2021-06-07,,0,,"5/3 orange drone flag 5/10 2+ chicks" +2021,jetport_south,284,wost,2021-03-10,2,,incubating,"4/13 1+ chick" +2021,jetport_south,284,wost,2021-03-15,4,,incubating,"4/13 1+ chick" +2021,jetport_south,284,wost,2021-03-22,4,,incubating,"4/13 1+ chick" +2021,jetport_south,284,wost,2021-03-29,4,,incubating,"4/13 1+ chick" +2021,jetport_south,284,wost,2021-04-05,,,missed,"4/13 1+ chick" +2021,jetport_south,284,wost,2021-04-13,,3,nestling,"4/13 1+ chick" +2021,jetport_south,284,wost,2021-04-19,,4,nestling,"4/13 1+ chick" +2021,jetport_south,284,wost,2021-04-26,,3,nestling,"4/13 1+ chick" +2021,jetport_south,284,wost,2021-05-03,,3,nestling,"4/13 1+ chick" +2021,jetport_south,284,wost,2021-05-10,,3,nestling,"4/13 1+ chick" +2021,jetport_south,284,wost,2021-05-17,,3,nestling,"4/13 1+ chick" +2021,jetport_south,284,wost,2021-05-25,,3,fledged,"4/13 1+ chick" +2021,jetport_south,284,wost,2021-05-31,,0,fledged,"4/13 1+ chick" +2021,jetport_south,284,wost,2021-06-07,,0,,"4/13 1+ chick" +2021,jetport_south,286,wost,2021-03-10,3,,incubating, +2021,jetport_south,286,wost,2021-03-15,3,,incubating, +2021,jetport_south,286,wost,2021-03-22,3,,incubating, +2021,jetport_south,286,wost,2021-03-29,3,,incubating, +2021,jetport_south,286,wost,2021-04-05,,,missed, +2021,jetport_south,286,wost,2021-04-13,,3,nestling, +2021,jetport_south,286,wost,2021-04-19,,3,nestling, +2021,jetport_south,286,wost,2021-04-26,,3,nestling, +2021,jetport_south,286,wost,2021-05-03,,3,nestling, +2021,jetport_south,286,wost,2021-05-10,,3,nestling, +2021,jetport_south,286,wost,2021-05-17,,3,nestling, +2021,jetport_south,286,wost,2021-05-25,,2,fledged, +2021,jetport_south,286,wost,2021-05-31,,0,fledged, +2021,jetport_south,286,wost,2021-06-07,,0,, +2021,jetport_south,288,wost,2021-03-10,2,,incubating, +2021,jetport_south,288,wost,2021-03-15,4,,incubating, +2021,jetport_south,288,wost,2021-03-22,4,,incubating, +2021,jetport_south,288,wost,2021-03-29,3,,incubating, +2021,jetport_south,288,wost,2021-04-05,,,missed, +2021,jetport_south,288,wost,2021-04-13,,3,nestling, +2021,jetport_south,288,wost,2021-04-19,,3,nestling, +2021,jetport_south,288,wost,2021-04-26,,3,nestling, +2021,jetport_south,288,wost,2021-05-03,,3,nestling, +2021,jetport_south,288,wost,2021-05-10,,3,nestling, +2021,jetport_south,288,wost,2021-05-17,,3,nestling, +2021,jetport_south,288,wost,2021-05-25,,2,fledged, +2021,jetport_south,288,wost,2021-05-31,,0,fledged, +2021,jetport_south,288,wost,2021-06-07,,0,, +2021,jetport_south,290,wost,2021-03-10,0,0,pre_flagged, +2021,jetport_south,290,wost,2021-03-15,0,0,pre_flagged, +2021,jetport_south,290,wost,2021-03-22,0,0,pre_flagged, +2021,jetport_south,290,wost,2021-03-29,3,,incubating, +2021,jetport_south,290,wost,2021-04-05,,,missed, +2021,jetport_south,290,wost,2021-04-13,3,,incubating, +2021,jetport_south,290,wost,2021-04-19,2,1,hatching, +2021,jetport_south,290,wost,2021-04-26,,2,nestling, +2021,jetport_south,290,wost,2021-05-03,,2,nestling, +2021,jetport_south,290,wost,2021-05-10,,2,nestling, +2021,jetport_south,290,wost,2021-05-17,,2,nestling, +2021,jetport_south,290,wost,2021-05-25,,2,nestling, +2021,jetport_south,290,wost,2021-05-31,,2,nestling, +2021,jetport_south,290,wost,2021-06-07,,2,nestling, +2021,jetport_south,332,wost,2021-03-10,,,incubating, +2021,jetport_south,332,wost,2021-03-15,,,, +2021,jetport_south,332,wost,2021-03-22,2,,incubating, +2021,jetport_south,332,wost,2021-03-29,3,,incubating, +2021,jetport_south,332,wost,2021-04-05,,,missed, +2021,jetport_south,332,wost,2021-04-13,3,,incubating, +2021,jetport_south,332,wost,2021-04-19,,3,nestling, +2021,jetport_south,332,wost,2021-04-26,,3,nestling, +2021,jetport_south,332,wost,2021-05-03,,3,nestling, +2021,jetport_south,332,wost,2021-05-10,,2,nestling, +2021,jetport_south,332,wost,2021-05-17,,2,nestling, +2021,jetport_south,332,wost,2021-05-25,,2,nestling, +2021,jetport_south,332,wost,2021-05-31,,2,nestling, +2021,jetport_south,332,wost,2021-06-07,,2,nestling, +2021,jetport_south,292,wost,2021-03-10,4,,incubating, +2021,jetport_south,292,wost,2021-03-15,4,,incubating, +2021,jetport_south,292,wost,2021-03-22,4,,incubating, +2021,jetport_south,292,wost,2021-03-29,4,,incubating, +2021,jetport_south,292,wost,2021-04-05,,,missed, +2021,jetport_south,292,wost,2021-04-13,,4,nestling, +2021,jetport_south,292,wost,2021-04-19,,4,nestling, +2021,jetport_south,292,wost,2021-04-26,,3,nestling, +2021,jetport_south,292,wost,2021-05-03,,3,nestling, +2021,jetport_south,292,wost,2021-05-10,,3,nestling, +2021,jetport_south,292,wost,2021-05-17,,3,nestling, +2021,jetport_south,292,wost,2021-05-25,,3,nestling, +2021,jetport_south,292,wost,2021-05-31,,1,fledged, +2021,jetport_south,292,wost,2021-06-07,,0,, +2021,jetport_south,294,wost,2021-03-10,4,,incubating, +2021,jetport_south,294,wost,2021-03-15,4,,incubating, +2021,jetport_south,294,wost,2021-03-22,4,,incubating, +2021,jetport_south,294,wost,2021-03-29,4,,incubating, +2021,jetport_south,294,wost,2021-04-05,,,missed, +2021,jetport_south,294,wost,2021-04-13,,4,nestling, +2021,jetport_south,294,wost,2021-04-19,,4,nestling, +2021,jetport_south,294,wost,2021-04-26,,3,nestling, +2021,jetport_south,294,wost,2021-05-03,,4,nestling, +2021,jetport_south,294,wost,2021-05-10,,3,nestling, +2021,jetport_south,294,wost,2021-05-17,,3,nestling, +2021,jetport_south,294,wost,2021-05-25,,3,nestling, +2021,jetport_south,294,wost,2021-05-31,,2,fledged, +2021,jetport_south,294,wost,2021-06-07,,0,, +2021,jetport_south,296,wost,2021-03-10,0,0,pre_flagged, +2021,jetport_south,296,wost,2021-03-15,2,,incubating, +2021,jetport_south,296,wost,2021-03-22,3,,incubating, +2021,jetport_south,296,wost,2021-03-29,3,,incubating, +2021,jetport_south,296,wost,2021-04-05,,,missed, +2021,jetport_south,296,wost,2021-04-13,,3,nestling, +2021,jetport_south,296,wost,2021-04-19,,3,nestling, +2021,jetport_south,296,wost,2021-04-26,,2,nestling, +2021,jetport_south,296,wost,2021-05-03,,2,nestling, +2021,jetport_south,296,wost,2021-05-10,,2,nestling, +2021,jetport_south,296,wost,2021-05-17,,2,nestling, +2021,jetport_south,296,wost,2021-05-25,,2,nestling, +2021,jetport_south,296,wost,2021-05-31,,1,fledged, +2021,jetport_south,296,wost,2021-06-07,,0,, +2021,jetport_south,298,wost,2021-03-10,0,0,pre_flagged, +2021,jetport_south,298,wost,2021-03-15,0,0,pre_flagged, +2021,jetport_south,298,wost,2021-03-22,0,0,pre_flagged, +2021,jetport_south,298,wost,2021-03-29,3,,incubating, +2021,jetport_south,298,wost,2021-04-05,,,missed, +2021,jetport_south,298,wost,2021-04-13,3,,incubating, +2021,jetport_south,298,wost,2021-04-19,3,,incubating, +2021,jetport_south,298,wost,2021-04-26,,2,nestling, +2021,jetport_south,298,wost,2021-05-03,,2,nestling, +2021,jetport_south,298,wost,2021-05-10,,2,nestling, +2021,jetport_south,298,wost,2021-05-17,,2,nestling, +2021,jetport_south,298,wost,2021-05-25,,2,nestling, +2021,jetport_south,298,wost,2021-05-31,,2,nestling, +2021,jetport_south,298,wost,2021-06-07,,2,nestling, +2021,jetport_south,300,wost,2021-03-10,2,,incubating,"5/3 pink/orange drone flag" +2021,jetport_south,300,wost,2021-03-15,3,,incubating,"5/3 pink/orange drone flag" +2021,jetport_south,300,wost,2021-03-22,3,,incubating,"5/3 pink/orange drone flag" +2021,jetport_south,300,wost,2021-03-29,3,,incubating,"5/3 pink/orange drone flag" +2021,jetport_south,300,wost,2021-04-05,,,missed,"5/3 pink/orange drone flag" +2021,jetport_south,300,wost,2021-04-13,,3,nestling,"5/3 pink/orange drone flag" +2021,jetport_south,300,wost,2021-04-19,,3,nestling,"5/3 pink/orange drone flag" +2021,jetport_south,300,wost,2021-04-26,,3,nestling,"5/3 pink/orange drone flag" +2021,jetport_south,300,wost,2021-05-03,,3,nestling,"5/3 pink/orange drone flag" +2021,jetport_south,300,wost,2021-05-10,,3,nestling,"5/3 pink/orange drone flag" +2021,jetport_south,300,wost,2021-05-17,,3,nestling,"5/3 pink/orange drone flag" +2021,jetport_south,300,wost,2021-05-25,,3,nestling,"5/3 pink/orange drone flag" +2021,jetport_south,300,wost,2021-05-31,,0,fledged,"5/3 pink/orange drone flag" +2021,jetport_south,300,wost,2021-06-07,,0,,"5/3 pink/orange drone flag" +2021,jetport_south,302,wost,2021-03-10,2,,incubating,"5/3 pink/orange drone flag" +2021,jetport_south,302,wost,2021-03-15,3,,incubating,"5/3 pink/orange drone flag" +2021,jetport_south,302,wost,2021-03-22,3,,incubating,"5/3 pink/orange drone flag" +2021,jetport_south,302,wost,2021-03-29,3,,incubating,"5/3 pink/orange drone flag" +2021,jetport_south,302,wost,2021-04-05,,,missed,"5/3 pink/orange drone flag" +2021,jetport_south,302,wost,2021-04-13,,3,nestling,"5/3 pink/orange drone flag" +2021,jetport_south,302,wost,2021-04-19,,3,nestling,"5/3 pink/orange drone flag" +2021,jetport_south,302,wost,2021-04-26,,2,nestling,"5/3 pink/orange drone flag" +2021,jetport_south,302,wost,2021-05-03,,2,nestling,"5/3 pink/orange drone flag" +2021,jetport_south,302,wost,2021-05-10,,2,nestling,"5/3 pink/orange drone flag" +2021,jetport_south,302,wost,2021-05-17,,2,nestling,"5/3 pink/orange drone flag" +2021,jetport_south,302,wost,2021-05-25,,2,nestling,"5/3 pink/orange drone flag" +2021,jetport_south,302,wost,2021-05-31,,0,fledged,"5/3 pink/orange drone flag" +2021,jetport_south,302,wost,2021-06-07,,0,,"5/3 pink/orange drone flag" +2021,jetport_south,304,wost,2021-03-10,1,,incubating,"5/3 pink/orange drone flag" +2021,jetport_south,304,wost,2021-03-15,3,,incubating,"5/3 pink/orange drone flag" +2021,jetport_south,304,wost,2021-03-22,3,,incubating,"5/3 pink/orange drone flag" +2021,jetport_south,304,wost,2021-03-29,3,,incubating,"5/3 pink/orange drone flag" +2021,jetport_south,304,wost,2021-04-05,,,missed,"5/3 pink/orange drone flag" +2021,jetport_south,304,wost,2021-04-13,,3,nestling,"5/3 pink/orange drone flag" +2021,jetport_south,304,wost,2021-04-19,,3,nestling,"5/3 pink/orange drone flag" +2021,jetport_south,304,wost,2021-04-26,,2,nestling,"5/3 pink/orange drone flag" +2021,jetport_south,304,wost,2021-05-03,,2,nestling,"5/3 pink/orange drone flag" +2021,jetport_south,304,wost,2021-05-10,,2,nestling,"5/3 pink/orange drone flag" +2021,jetport_south,304,wost,2021-05-17,,2,nestling,"5/3 pink/orange drone flag" +2021,jetport_south,304,wost,2021-05-25,,2,nestling,"5/3 pink/orange drone flag" +2021,jetport_south,304,wost,2021-05-31,,0,fledged,"5/3 pink/orange drone flag" +2021,jetport_south,304,wost,2021-06-07,,0,,"5/3 pink/orange drone flag" +2021,jetport_south,306,wost,2021-03-10,3,,incubating, +2021,jetport_south,306,wost,2021-03-15,4,,incubating, +2021,jetport_south,306,wost,2021-03-22,4,,incubating, +2021,jetport_south,306,wost,2021-03-29,4,,incubating, +2021,jetport_south,306,wost,2021-04-05,,,missed, +2021,jetport_south,306,wost,2021-04-13,,3,nestling, +2021,jetport_south,306,wost,2021-04-19,,4,nestling, +2021,jetport_south,306,wost,2021-04-26,,3,nestling, +2021,jetport_south,306,wost,2021-05-03,,3,nestling, +2021,jetport_south,306,wost,2021-05-10,,3,nestling, +2021,jetport_south,306,wost,2021-05-17,,4,nestling, +2021,jetport_south,306,wost,2021-05-25,,4,nestling, +2021,jetport_south,306,wost,2021-05-31,,0,fledged, +2021,jetport_south,306,wost,2021-06-07,,0,, +2021,jetport_south,113,wost,2021-03-10,,,,"6/7: pink drone paper" +2021,jetport_south,113,wost,2021-03-15,2,,incubating,"6/7: pink drone paper" +2021,jetport_south,113,wost,2021-03-22,4,,incubating,"6/7: pink drone paper" +2021,jetport_south,113,wost,2021-03-29,4,,incubating,"6/7: pink drone paper" +2021,jetport_south,113,wost,2021-04-05,,,missed,"6/7: pink drone paper" +2021,jetport_south,113,wost,2021-04-13,1,3,wet_chick,"6/7: pink drone paper" +2021,jetport_south,113,wost,2021-04-19,1,2,hatching,"6/7: pink drone paper" +2021,jetport_south,113,wost,2021-04-26,,3,nestling,"6/7: pink drone paper" +2021,jetport_south,113,wost,2021-05-03,1,1,hatching,"6/7: pink drone paper" +2021,jetport_south,113,wost,2021-05-10,,1,nestling,"6/7: pink drone paper" +2021,jetport_south,113,wost,2021-05-17,,1,nestling,"6/7: pink drone paper" +2021,jetport_south,113,wost,2021-05-25,,1,nestling,"6/7: pink drone paper" +2021,jetport_south,113,wost,2021-05-31,,1,nestling,"6/7: pink drone paper" +2021,jetport_south,113,wost,2021-06-07,,0,,"6/7: pink drone paper" +2021,jetport_south,115,wost,2021-03-10,,,,"5/31 blue drone flag" +2021,jetport_south,115,wost,2021-03-15,1,,incubating,"5/31 blue drone flag" +2021,jetport_south,115,wost,2021-03-22,4,,incubating,"5/31 blue drone flag" +2021,jetport_south,115,wost,2021-03-29,4,,incubating,"5/31 blue drone flag" +2021,jetport_south,115,wost,2021-04-05,4,,incubating,"5/31 blue drone flag" +2021,jetport_south,115,wost,2021-04-13,1,3,hatching,"5/31 blue drone flag" +2021,jetport_south,115,wost,2021-04-19,,2,nestling,"5/31 blue drone flag" +2021,jetport_south,115,wost,2021-04-26,,2,nestling,"5/31 blue drone flag" +2021,jetport_south,115,wost,2021-05-03,,1,nestling,"5/31 blue drone flag" +2021,jetport_south,115,wost,2021-05-10,,2,nestling,"5/31 blue drone flag" +2021,jetport_south,115,wost,2021-05-17,,2,nestling,"5/31 blue drone flag" +2021,jetport_south,115,wost,2021-05-25,,2,nestling,"5/31 blue drone flag" +2021,jetport_south,115,wost,2021-05-31,,3,fledged,"5/31 blue drone flag" +2021,jetport_south,115,wost,2021-06-07,,0,,"5/31 blue drone flag" +2021,jetport_south,316,wost,2021-03-10,,,,"5/10 2+ chicks" +2021,jetport_south,316,wost,2021-03-15,1,,incubating,"5/10 2+ chicks" +2021,jetport_south,316,wost,2021-03-22,3,,incubating,"5/10 2+ chicks" +2021,jetport_south,316,wost,2021-03-29,3,,incubating,"5/10 2+ chicks" +2021,jetport_south,316,wost,2021-04-05,3,,incubating,"5/10 2+ chicks" +2021,jetport_south,316,wost,2021-04-13,1,2,hatching,"5/10 2+ chicks" +2021,jetport_south,316,wost,2021-04-19,,3,nestling,"5/10 2+ chicks" +2021,jetport_south,316,wost,2021-04-26,,3,nestling,"5/10 2+ chicks" +2021,jetport_south,316,wost,2021-05-03,,3,nestling,"5/10 2+ chicks" +2021,jetport_south,316,wost,2021-05-10,,2,nestling,"5/10 2+ chicks" +2021,jetport_south,316,wost,2021-05-17,,3,nestling,"5/10 2+ chicks" +2021,jetport_south,316,wost,2021-05-25,,3,nestling,"5/10 2+ chicks" +2021,jetport_south,316,wost,2021-05-31,,2,fledged,"5/10 2+ chicks" +2021,jetport_south,316,wost,2021-06-07,,0,,"5/10 2+ chicks" +2021,jetport_south,318,wost,2021-03-10,,,,"4/19 3+ chicks" +2021,jetport_south,318,wost,2021-03-15,1,,incubating,"4/19 3+ chicks" +2021,jetport_south,318,wost,2021-03-22,4,,incubating,"4/19 3+ chicks" +2021,jetport_south,318,wost,2021-03-29,4,,incubating,"4/19 3+ chicks" +2021,jetport_south,318,wost,2021-04-05,4,,incubating,"4/19 3+ chicks" +2021,jetport_south,318,wost,2021-04-13,2,2,hatching,"4/19 3+ chicks" +2021,jetport_south,318,wost,2021-04-19,,3,nestling,"4/19 3+ chicks" +2021,jetport_south,318,wost,2021-04-26,,2,nestling,"4/19 3+ chicks" +2021,jetport_south,318,wost,2021-05-03,,2,nestling,"4/19 3+ chicks" +2021,jetport_south,318,wost,2021-05-10,,2,nestling,"4/19 3+ chicks" +2021,jetport_south,318,wost,2021-05-17,,2,nestling,"4/19 3+ chicks" +2021,jetport_south,318,wost,2021-05-25,,2,nestling,"4/19 3+ chicks" +2021,jetport_south,318,wost,2021-05-31,,2,fledged,"4/19 3+ chicks" +2021,jetport_south,318,wost,2021-06-07,,0,,"4/19 3+ chicks" +2021,jetport_south,117,wost,2021-03-10,,,, +2021,jetport_south,117,wost,2021-03-15,1,,incubating, +2021,jetport_south,117,wost,2021-03-22,4,,incubating, +2021,jetport_south,117,wost,2021-03-29,4,,incubating, +2021,jetport_south,117,wost,2021-04-05,4,,incubating, +2021,jetport_south,117,wost,2021-04-13,1,3,hatching, +2021,jetport_south,117,wost,2021-04-19,,4,nestling, +2021,jetport_south,117,wost,2021-04-26,,3,nestling, +2021,jetport_south,117,wost,2021-05-03,,3,nestling, +2021,jetport_south,117,wost,2021-05-10,,2,nestling, +2021,jetport_south,117,wost,2021-05-17,,3,nestling, +2021,jetport_south,117,wost,2021-05-25,,3,nestling, +2021,jetport_south,117,wost,2021-05-31,,3,fledged, +2021,jetport_south,117,wost,2021-06-07,,0,, +2021,jetport_south,520,wost,2021-03-10,,,, +2021,jetport_south,520,wost,2021-03-15,2,,incubating, +2021,jetport_south,520,wost,2021-03-22,4,,incubating, +2021,jetport_south,520,wost,2021-03-29,4,,incubating, +2021,jetport_south,520,wost,2021-04-05,4,,incubating, +2021,jetport_south,520,wost,2021-04-13,,,missed, +2021,jetport_south,520,wost,2021-04-19,,3,nestling, +2021,jetport_south,520,wost,2021-04-26,,2,nestling, +2021,jetport_south,520,wost,2021-05-03,,2,nestling, +2021,jetport_south,520,wost,2021-05-10,,2,nestling, +2021,jetport_south,520,wost,2021-05-17,,2,nestling, +2021,jetport_south,520,wost,2021-05-25,,2,nestling, +2021,jetport_south,520,wost,2021-05-31,,2,fledged, +2021,jetport_south,520,wost,2021-06-07,,0,, +2021,jetport_south,522,wost,2021-03-10,,,, +2021,jetport_south,522,wost,2021-03-15,2,,incubating, +2021,jetport_south,522,wost,2021-03-22,3,,incubating, +2021,jetport_south,522,wost,2021-03-29,3,,incubating, +2021,jetport_south,522,wost,2021-04-05,2,,incubating, +2021,jetport_south,522,wost,2021-04-13,,2,nestling, +2021,jetport_south,522,wost,2021-04-19,,2,nestling, +2021,jetport_south,522,wost,2021-04-26,,2,nestling, +2021,jetport_south,522,wost,2021-05-03,,2,nestling, +2021,jetport_south,522,wost,2021-05-10,,2,nestling, +2021,jetport_south,522,wost,2021-05-17,,2,nestling, +2021,jetport_south,522,wost,2021-05-25,,2,nestling, +2021,jetport_south,522,wost,2021-05-31,,1,fledged, +2021,jetport_south,522,wost,2021-06-07,,0,, +2021,jetport_south,320,wost,2021-03-10,,,,"5/17 2 dead chicks in nest; 6/7: blue drone paper" +2021,jetport_south,320,wost,2021-03-15,1,,incubating,"5/17 2 dead chicks in nest; 6/7: blue drone paper" +2021,jetport_south,320,wost,2021-03-22,4,,incubating,"5/17 2 dead chicks in nest; 6/7: blue drone paper" +2021,jetport_south,320,wost,2021-03-29,4,,incubating,"5/17 2 dead chicks in nest; 6/7: blue drone paper" +2021,jetport_south,320,wost,2021-04-05,4,,incubating,"5/17 2 dead chicks in nest; 6/7: blue drone paper" +2021,jetport_south,320,wost,2021-04-13,2,2,hatching,"5/17 2 dead chicks in nest; 6/7: blue drone paper" +2021,jetport_south,320,wost,2021-04-19,,3,nestling,"5/17 2 dead chicks in nest; 6/7: blue drone paper" +2021,jetport_south,320,wost,2021-04-26,,3,nestling,"5/17 2 dead chicks in nest; 6/7: blue drone paper" +2021,jetport_south,320,wost,2021-05-03,,2,nestling,"5/17 2 dead chicks in nest; 6/7: blue drone paper" +2021,jetport_south,320,wost,2021-05-10,,2,nestling,"5/17 2 dead chicks in nest; 6/7: blue drone paper" +2021,jetport_south,320,wost,2021-05-17,,0,empty,"5/17 2 dead chicks in nest; 6/7: blue drone paper" +2021,jetport_south,320,wost,2021-05-25,,,,"5/17 2 dead chicks in nest; 6/7: blue drone paper" +2021,jetport_south,320,wost,2021-05-31,,,,"5/17 2 dead chicks in nest; 6/7: blue drone paper" +2021,jetport_south,320,wost,2021-06-07,,0,,"5/17 2 dead chicks in nest; 6/7: blue drone paper" +2021,jetport_south,524,wost,2021-03-10,,,,"5/31: 1 dead chick hanging from nest; 6/7: 3 total with 526" +2021,jetport_south,524,wost,2021-03-15,1,,incubating,"5/31: 1 dead chick hanging from nest; 6/7: 3 total with 526" +2021,jetport_south,524,wost,2021-03-22,3,,incubating,"5/31: 1 dead chick hanging from nest; 6/7: 3 total with 526" +2021,jetport_south,524,wost,2021-03-29,3,,incubating,"5/31: 1 dead chick hanging from nest; 6/7: 3 total with 526" +2021,jetport_south,524,wost,2021-04-05,3,,incubating,"5/31: 1 dead chick hanging from nest; 6/7: 3 total with 526" +2021,jetport_south,524,wost,2021-04-13,2,1,hatching,"5/31: 1 dead chick hanging from nest; 6/7: 3 total with 526" +2021,jetport_south,524,wost,2021-04-19,,3,nestling,"5/31: 1 dead chick hanging from nest; 6/7: 3 total with 526" +2021,jetport_south,524,wost,2021-04-26,,3,nestling,"5/31: 1 dead chick hanging from nest; 6/7: 3 total with 526" +2021,jetport_south,524,wost,2021-05-03,,3,nestling,"5/31: 1 dead chick hanging from nest; 6/7: 3 total with 526" +2021,jetport_south,524,wost,2021-05-10,,3,nestling,"5/31: 1 dead chick hanging from nest; 6/7: 3 total with 526" +2021,jetport_south,524,wost,2021-05-17,,3,nestling,"5/31: 1 dead chick hanging from nest; 6/7: 3 total with 526" +2021,jetport_south,524,wost,2021-05-25,,3,nestling,"5/31: 1 dead chick hanging from nest; 6/7: 3 total with 526" +2021,jetport_south,524,wost,2021-05-31,,2,nestling,"5/31: 1 dead chick hanging from nest; 6/7: 3 total with 526" +2021,jetport_south,524,wost,2021-06-07,,2,nestling,"5/31: 1 dead chick hanging from nest; 6/7: 3 total with 526" +2021,jetport_south,526,wost,2021-03-10,,,,"6/7: 3 total with 524" +2021,jetport_south,526,wost,2021-03-15,1,,incubating,"6/7: 3 total with 524" +2021,jetport_south,526,wost,2021-03-22,4,,incubating,"6/7: 3 total with 524" +2021,jetport_south,526,wost,2021-03-29,4,,incubating,"6/7: 3 total with 524" +2021,jetport_south,526,wost,2021-04-05,4,,incubating,"6/7: 3 total with 524" +2021,jetport_south,526,wost,2021-04-13,2,2,hatching,"6/7: 3 total with 524" +2021,jetport_south,526,wost,2021-04-19,1,3,hatching,"6/7: 3 total with 524" +2021,jetport_south,526,wost,2021-04-26,,3,nestling,"6/7: 3 total with 524" +2021,jetport_south,526,wost,2021-05-03,,3,nestling,"6/7: 3 total with 524" +2021,jetport_south,526,wost,2021-05-10,,3,nestling,"6/7: 3 total with 524" +2021,jetport_south,526,wost,2021-05-17,,3,nestling,"6/7: 3 total with 524" +2021,jetport_south,526,wost,2021-05-25,,2,nestling,"6/7: 3 total with 524" +2021,jetport_south,526,wost,2021-05-31,,2,nestling,"6/7: 3 total with 524" +2021,jetport_south,526,wost,2021-06-07,,1,nestling,"6/7: 3 total with 524" +2021,jetport_south,536,wost,2021-03-10,,,,"5/3: purple drone flag" +2021,jetport_south,536,wost,2021-03-15,,,,"5/3: purple drone flag" +2021,jetport_south,536,wost,2021-03-22,0,0,pre_flagged,"5/3: purple drone flag" +2021,jetport_south,536,wost,2021-03-29,3,,incubating,"5/3: purple drone flag" +2021,jetport_south,536,wost,2021-04-05,4,,incubating,"5/3: purple drone flag" +2021,jetport_south,536,wost,2021-04-13,4,,incubating,"5/3: purple drone flag" +2021,jetport_south,536,wost,2021-04-19,4,,incubating,"5/3: purple drone flag" +2021,jetport_south,536,wost,2021-04-26,1,2,pipping,"5/3: purple drone flag" +2021,jetport_south,536,wost,2021-05-03,,3,nestling,"5/3: purple drone flag" +2021,jetport_south,536,wost,2021-05-10,,3,nestling,"5/3: purple drone flag" +2021,jetport_south,536,wost,2021-05-17,,3,nestling,"5/3: purple drone flag" +2021,jetport_south,536,wost,2021-05-25,,3,nestling,"5/3: purple drone flag" +2021,jetport_south,536,wost,2021-05-31,,3,nestling,"5/3: purple drone flag" +2021,jetport_south,536,wost,2021-06-07,,3,fledged,"5/3: purple drone flag" +2021,jetport_south,538,wost,2021-03-10,,,,"5/3: purple drone flag" +2021,jetport_south,538,wost,2021-03-15,,,,"5/3: purple drone flag" +2021,jetport_south,538,wost,2021-03-22,0,0,pre_flagged,"5/3: purple drone flag" +2021,jetport_south,538,wost,2021-03-29,2,,incubating,"5/3: purple drone flag" +2021,jetport_south,538,wost,2021-04-05,2,,incubating,"5/3: purple drone flag" +2021,jetport_south,538,wost,2021-04-13,2,,incubating,"5/3: purple drone flag" +2021,jetport_south,538,wost,2021-04-19,2,,incubating,"5/3: purple drone flag" +2021,jetport_south,538,wost,2021-04-26,,2,nestling,"5/3: purple drone flag" +2021,jetport_south,538,wost,2021-05-03,,2,nestling,"5/3: purple drone flag" +2021,jetport_south,538,wost,2021-05-10,,2,nestling,"5/3: purple drone flag" +2021,jetport_south,538,wost,2021-05-17,,3,nestling,"5/3: purple drone flag" +2021,jetport_south,538,wost,2021-05-25,,2,nestling,"5/3: purple drone flag" +2021,jetport_south,538,wost,2021-05-31,,2,nestling,"5/3: purple drone flag" +2021,jetport_south,538,wost,2021-06-07,,2,fledged,"5/3: purple drone flag" +2021,jetport_south,540,wost,2021-03-10,,,,"5/3: purple drone flag" +2021,jetport_south,540,wost,2021-03-15,,,,"5/3: purple drone flag" +2021,jetport_south,540,wost,2021-03-22,0,0,pre_flagged,"5/3: purple drone flag" +2021,jetport_south,540,wost,2021-03-29,3,,incubating,"5/3: purple drone flag" +2021,jetport_south,540,wost,2021-04-05,3,,incubating,"5/3: purple drone flag" +2021,jetport_south,540,wost,2021-04-13,3,,incubating,"5/3: purple drone flag" +2021,jetport_south,540,wost,2021-04-19,2,1,hatching,"5/3: purple drone flag" +2021,jetport_south,540,wost,2021-04-26,,3,nestling,"5/3: purple drone flag" +2021,jetport_south,540,wost,2021-05-03,,3,nestling,"5/3: purple drone flag" +2021,jetport_south,540,wost,2021-05-10,,3,nestling,"5/3: purple drone flag" +2021,jetport_south,540,wost,2021-05-17,,3,nestling,"5/3: purple drone flag" +2021,jetport_south,540,wost,2021-05-25,,3,nestling,"5/3: purple drone flag" +2021,jetport_south,540,wost,2021-05-31,,3,nestling,"5/3: purple drone flag" +2021,jetport_south,540,wost,2021-06-07,,3,fledged,"5/3: purple drone flag" +2021,jetport_south,336,wost,2021-03-10,,,,"5/25 nest collapsed" +2021,jetport_south,336,wost,2021-03-15,,,,"5/25 nest collapsed" +2021,jetport_south,336,wost,2021-03-22,,,,"5/25 nest collapsed" +2021,jetport_south,336,wost,2021-03-29,2,,incubating,"5/25 nest collapsed" +2021,jetport_south,336,wost,2021-04-05,3,,incubating,"5/25 nest collapsed" +2021,jetport_south,336,wost,2021-04-13,3,,incubating,"5/25 nest collapsed" +2021,jetport_south,336,wost,2021-04-19,3,,incubating,"5/25 nest collapsed" +2021,jetport_south,336,wost,2021-04-26,,3,nestling,"5/25 nest collapsed" +2021,jetport_south,336,wost,2021-05-03,,3,nestling,"5/25 nest collapsed" +2021,jetport_south,336,wost,2021-05-10,,3,nestling,"5/25 nest collapsed" +2021,jetport_south,336,wost,2021-05-17,,3,nestling,"5/25 nest collapsed" +2021,jetport_south,336,wost,2021-05-25,,0,empty,"5/25 nest collapsed" +2021,jetport_south,336,wost,2021-05-31,,,,"5/25 nest collapsed" +2021,jetport_south,336,wost,2021-06-07,,,,"5/25 nest collapsed" +2021,jetport_south,338,wost,2021-03-10,,,,"4/5 orange drone flagging 4/19 flagging pulled; 5/31 purple/yellow drone flag" +2021,jetport_south,338,wost,2021-03-15,,,,"4/5 orange drone flagging 4/19 flagging pulled; 5/31 purple/yellow drone flag" +2021,jetport_south,338,wost,2021-03-22,,,,"4/5 orange drone flagging 4/19 flagging pulled; 5/31 purple/yellow drone flag" +2021,jetport_south,338,wost,2021-03-29,3,,incubating,"4/5 orange drone flagging 4/19 flagging pulled; 5/31 purple/yellow drone flag" +2021,jetport_south,338,wost,2021-04-05,4,,incubating,"4/5 orange drone flagging 4/19 flagging pulled; 5/31 purple/yellow drone flag" +2021,jetport_south,338,wost,2021-04-13,4,,incubating,"4/5 orange drone flagging 4/19 flagging pulled; 5/31 purple/yellow drone flag" +2021,jetport_south,338,wost,2021-04-19,4,,incubating,"4/5 orange drone flagging 4/19 flagging pulled; 5/31 purple/yellow drone flag" +2021,jetport_south,338,wost,2021-04-26,,4,nestling,"4/5 orange drone flagging 4/19 flagging pulled; 5/31 purple/yellow drone flag" +2021,jetport_south,338,wost,2021-05-03,,3,nestling,"4/5 orange drone flagging 4/19 flagging pulled; 5/31 purple/yellow drone flag" +2021,jetport_south,338,wost,2021-05-10,,3,nestling,"4/5 orange drone flagging 4/19 flagging pulled; 5/31 purple/yellow drone flag" +2021,jetport_south,338,wost,2021-05-17,,3,nestling,"4/5 orange drone flagging 4/19 flagging pulled; 5/31 purple/yellow drone flag" +2021,jetport_south,338,wost,2021-05-25,,3,nestling,"4/5 orange drone flagging 4/19 flagging pulled; 5/31 purple/yellow drone flag" +2021,jetport_south,338,wost,2021-05-31,,3,nestling,"4/5 orange drone flagging 4/19 flagging pulled; 5/31 purple/yellow drone flag" +2021,jetport_south,338,wost,2021-06-07,,3,fledged,"4/5 orange drone flagging 4/19 flagging pulled; 5/31 purple/yellow drone flag" +2021,jetport_south,340,wost,2021-03-10,,,,"4/5 orange drone flagging 4/19 flagging pulled; 5/3: one dead chick" +2021,jetport_south,340,wost,2021-03-15,,,,"4/5 orange drone flagging 4/19 flagging pulled; 5/3: one dead chick" +2021,jetport_south,340,wost,2021-03-22,,,,"4/5 orange drone flagging 4/19 flagging pulled; 5/3: one dead chick" +2021,jetport_south,340,wost,2021-03-29,4,,incubating,"4/5 orange drone flagging 4/19 flagging pulled; 5/3: one dead chick" +2021,jetport_south,340,wost,2021-04-05,4,,incubating,"4/5 orange drone flagging 4/19 flagging pulled; 5/3: one dead chick" +2021,jetport_south,340,wost,2021-04-13,4,,pipping,"4/5 orange drone flagging 4/19 flagging pulled; 5/3: one dead chick" +2021,jetport_south,340,wost,2021-04-19,4,,pipping,"4/5 orange drone flagging 4/19 flagging pulled; 5/3: one dead chick" +2021,jetport_south,340,wost,2021-04-26,,3,nestling,"4/5 orange drone flagging 4/19 flagging pulled; 5/3: one dead chick" +2021,jetport_south,340,wost,2021-05-03,0,0,empty,"4/5 orange drone flagging 4/19 flagging pulled; 5/3: one dead chick" +2021,jetport_south,340,wost,2021-05-10,,,,"4/5 orange drone flagging 4/19 flagging pulled; 5/3: one dead chick" +2021,jetport_south,340,wost,2021-05-17,,,,"4/5 orange drone flagging 4/19 flagging pulled; 5/3: one dead chick" +2021,jetport_south,340,wost,2021-05-25,,,,"4/5 orange drone flagging 4/19 flagging pulled; 5/3: one dead chick" +2021,jetport_south,340,wost,2021-05-31,,,,"4/5 orange drone flagging 4/19 flagging pulled; 5/3: one dead chick" +2021,jetport_south,340,wost,2021-06-07,,,,"4/5 orange drone flagging 4/19 flagging pulled; 5/3: one dead chick" +2021,jetport_south,342,wost,2021-03-10,,,,"5/3: dead chicks, blue drone flag" +2021,jetport_south,342,wost,2021-03-15,,,,"5/3: dead chicks, blue drone flag" +2021,jetport_south,342,wost,2021-03-22,,,,"5/3: dead chicks, blue drone flag" +2021,jetport_south,342,wost,2021-03-29,1,,incubating,"5/3: dead chicks, blue drone flag" +2021,jetport_south,342,wost,2021-04-05,3,,incubating,"5/3: dead chicks, blue drone flag" +2021,jetport_south,342,wost,2021-04-13,3,,incubating,"5/3: dead chicks, blue drone flag" +2021,jetport_south,342,wost,2021-04-19,3,,incubating,"5/3: dead chicks, blue drone flag" +2021,jetport_south,342,wost,2021-04-26,2,1,pipping,"5/3: dead chicks, blue drone flag" +2021,jetport_south,342,wost,2021-05-03,0,0,empty,"5/3: dead chicks, blue drone flag" +2021,jetport_south,342,wost,2021-05-10,,,,"5/3: dead chicks, blue drone flag" +2021,jetport_south,342,wost,2021-05-17,,,,"5/3: dead chicks, blue drone flag" +2021,jetport_south,342,wost,2021-05-25,,,,"5/3: dead chicks, blue drone flag" +2021,jetport_south,342,wost,2021-05-31,,,,"5/3: dead chicks, blue drone flag" +2021,jetport_south,342,wost,2021-06-07,,,,"5/3: dead chicks, blue drone flag" +2021,jetport_south,344,wost,2021-03-10,,,,"4/5 orange drone flagging 4/19 flaggging pulled" +2021,jetport_south,344,wost,2021-03-15,,,,"4/5 orange drone flagging 4/19 flaggging pulled" +2021,jetport_south,344,wost,2021-03-22,,,,"4/5 orange drone flagging 4/19 flaggging pulled" +2021,jetport_south,344,wost,2021-03-29,2,,incubating,"4/5 orange drone flagging 4/19 flaggging pulled" +2021,jetport_south,344,wost,2021-04-05,3,,incubating,"4/5 orange drone flagging 4/19 flaggging pulled" +2021,jetport_south,344,wost,2021-04-13,3,,incubating,"4/5 orange drone flagging 4/19 flaggging pulled" +2021,jetport_south,344,wost,2021-04-19,3,,incubating,"4/5 orange drone flagging 4/19 flaggging pulled" +2021,jetport_south,344,wost,2021-04-26,1,2,hatching,"4/5 orange drone flagging 4/19 flaggging pulled" +2021,jetport_south,344,wost,2021-05-03,,3,nestling,"4/5 orange drone flagging 4/19 flaggging pulled" +2021,jetport_south,344,wost,2021-05-10,,3,nestling,"4/5 orange drone flagging 4/19 flaggging pulled" +2021,jetport_south,344,wost,2021-05-17,,3,nestling,"4/5 orange drone flagging 4/19 flaggging pulled" +2021,jetport_south,344,wost,2021-05-25,,3,nestling,"4/5 orange drone flagging 4/19 flaggging pulled" +2021,jetport_south,344,wost,2021-05-31,,3,nestling,"4/5 orange drone flagging 4/19 flaggging pulled" +2021,jetport_south,344,wost,2021-06-07,,3,,"4/5 orange drone flagging 4/19 flaggging pulled" +2021,jetport_south,346,wost,2021-03-10,,,,"4/5 orange drone flagging 4/19 nest empty and on the ground, flagging pulled; 5/3 yellow drone flag" +2021,jetport_south,346,wost,2021-03-15,,,,"4/5 orange drone flagging 4/19 nest empty and on the ground, flagging pulled; 5/3 yellow drone flag" +2021,jetport_south,346,wost,2021-03-22,,,,"4/5 orange drone flagging 4/19 nest empty and on the ground, flagging pulled; 5/3 yellow drone flag" +2021,jetport_south,346,wost,2021-03-29,1,,incubating,"4/5 orange drone flagging 4/19 nest empty and on the ground, flagging pulled; 5/3 yellow drone flag" +2021,jetport_south,346,wost,2021-04-05,3,,incubating,"4/5 orange drone flagging 4/19 nest empty and on the ground, flagging pulled; 5/3 yellow drone flag" +2021,jetport_south,346,wost,2021-04-13,0,,empty,"4/5 orange drone flagging 4/19 nest empty and on the ground, flagging pulled; 5/3 yellow drone flag" +2021,jetport_south,346,wost,2021-04-19,,,,"4/5 orange drone flagging 4/19 nest empty and on the ground, flagging pulled; 5/3 yellow drone flag" +2021,jetport_south,346,wost,2021-04-26,,,,"4/5 orange drone flagging 4/19 nest empty and on the ground, flagging pulled; 5/3 yellow drone flag" +2021,jetport_south,346,wost,2021-05-03,,,,"4/5 orange drone flagging 4/19 nest empty and on the ground, flagging pulled; 5/3 yellow drone flag" +2021,jetport_south,346,wost,2021-05-10,,,,"4/5 orange drone flagging 4/19 nest empty and on the ground, flagging pulled; 5/3 yellow drone flag" +2021,jetport_south,346,wost,2021-05-17,,,,"4/5 orange drone flagging 4/19 nest empty and on the ground, flagging pulled; 5/3 yellow drone flag" +2021,jetport_south,346,wost,2021-05-25,,,,"4/5 orange drone flagging 4/19 nest empty and on the ground, flagging pulled; 5/3 yellow drone flag" +2021,jetport_south,346,wost,2021-05-31,,,,"4/5 orange drone flagging 4/19 nest empty and on the ground, flagging pulled; 5/3 yellow drone flag" +2021,jetport_south,346,wost,2021-06-07,,,,"4/5 orange drone flagging 4/19 nest empty and on the ground, flagging pulled; 5/3 yellow drone flag" +2021,jetport_south,364,wost,2021-03-10,,,,"5/10 nest collapsed" +2021,jetport_south,364,wost,2021-03-15,,,,"5/10 nest collapsed" +2021,jetport_south,364,wost,2021-03-22,,,,"5/10 nest collapsed" +2021,jetport_south,364,wost,2021-03-29,,,,"5/10 nest collapsed" +2021,jetport_south,364,wost,2021-04-05,2,,incubating,"5/10 nest collapsed" +2021,jetport_south,364,wost,2021-04-13,2,,incubating,"5/10 nest collapsed" +2021,jetport_south,364,wost,2021-04-19,2,,incubating,"5/10 nest collapsed" +2021,jetport_south,364,wost,2021-04-26,2,,incubating,"5/10 nest collapsed" +2021,jetport_south,364,wost,2021-05-03,0,,empty,"5/10 nest collapsed" +2021,jetport_south,364,wost,2021-05-10,,,,"5/10 nest collapsed" +2021,jetport_south,364,wost,2021-05-17,,,,"5/10 nest collapsed" +2021,jetport_south,364,wost,2021-05-25,,,,"5/10 nest collapsed" +2021,jetport_south,364,wost,2021-05-31,,,,"5/10 nest collapsed" +2021,jetport_south,364,wost,2021-06-07,,,,"5/10 nest collapsed" +2021,jetport_south,366,wost,2021-03-10,,,, +2021,jetport_south,366,wost,2021-03-15,,,, +2021,jetport_south,366,wost,2021-03-22,,,, +2021,jetport_south,366,wost,2021-03-29,,,, +2021,jetport_south,366,wost,2021-04-05,1,,incubating, +2021,jetport_south,366,wost,2021-04-13,3,,incubating, +2021,jetport_south,366,wost,2021-04-19,,,missed, +2021,jetport_south,366,wost,2021-04-26,3,,incubating, +2021,jetport_south,366,wost,2021-05-03,1,1,wet_chick, +2021,jetport_south,366,wost,2021-05-10,,3,nestling, +2021,jetport_south,366,wost,2021-05-17,,3,nestling, +2021,jetport_south,366,wost,2021-05-25,,2,nestling, +2021,jetport_south,366,wost,2021-05-31,,2,nestling, +2021,jetport_south,366,wost,2021-06-07,,2,nestling, +2021,jetport_south,368,wost,2021-03-10,,,,"5/10 3 + chicks" +2021,jetport_south,368,wost,2021-03-15,,,,"5/10 3 + chicks" +2021,jetport_south,368,wost,2021-03-22,,,,"5/10 3 + chicks" +2021,jetport_south,368,wost,2021-03-29,,,,"5/10 3 + chicks" +2021,jetport_south,368,wost,2021-04-05,4,,incubating,"5/10 3 + chicks" +2021,jetport_south,368,wost,2021-04-13,4,,incubating,"5/10 3 + chicks" +2021,jetport_south,368,wost,2021-04-19,4,,incubating,"5/10 3 + chicks" +2021,jetport_south,368,wost,2021-04-26,3,1,hatching,"5/10 3 + chicks" +2021,jetport_south,368,wost,2021-05-03,,4,nestling,"5/10 3 + chicks" +2021,jetport_south,368,wost,2021-05-10,,3,nestling,"5/10 3 + chicks" +2021,jetport_south,368,wost,2021-05-17,,4,nestling,"5/10 3 + chicks" +2021,jetport_south,368,wost,2021-05-25,,4,nestling,"5/10 3 + chicks" +2021,jetport_south,368,wost,2021-05-31,,4,nestling,"5/10 3 + chicks" +2021,jetport_south,368,wost,2021-06-07,,4,nestling,"5/10 3 + chicks" +2021,jetport_south,370,wost,2021-03-10,,,, +2021,jetport_south,370,wost,2021-03-15,,,, +2021,jetport_south,370,wost,2021-03-22,,,, +2021,jetport_south,370,wost,2021-03-29,,,, +2021,jetport_south,370,wost,2021-04-05,3,,incubating, +2021,jetport_south,370,wost,2021-04-13,3,,incubating, +2021,jetport_south,370,wost,2021-04-19,3,,incubating, +2021,jetport_south,370,wost,2021-04-26,2,1,pipping, +2021,jetport_south,370,wost,2021-05-03,,3,nestling, +2021,jetport_south,370,wost,2021-05-10,,3,nestling, +2021,jetport_south,370,wost,2021-05-17,,3,nestling, +2021,jetport_south,370,wost,2021-05-25,,3,nestling, +2021,jetport_south,370,wost,2021-05-31,,2,nestling, +2021,jetport_south,370,wost,2021-06-07,,3,nestling, +2021,jetport_south,372,wost,2021-03-10,,,, +2021,jetport_south,372,wost,2021-03-15,,,, +2021,jetport_south,372,wost,2021-03-22,,,, +2021,jetport_south,372,wost,2021-03-29,,,, +2021,jetport_south,372,wost,2021-04-05,2,,incubating, +2021,jetport_south,372,wost,2021-04-13,3,,incubating, +2021,jetport_south,372,wost,2021-04-19,2,,incubating, +2021,jetport_south,372,wost,2021-04-26,1,1,hatching, +2021,jetport_south,372,wost,2021-05-03,,2,nestling, +2021,jetport_south,372,wost,2021-05-10,,2,nestling, +2021,jetport_south,372,wost,2021-05-17,,2,nestling, +2021,jetport_south,372,wost,2021-05-25,,2,nestling, +2021,jetport_south,372,wost,2021-05-31,,2,nestling, +2021,jetport_south,372,wost,2021-06-07,,2,nestling, +2021,jetport_south,374,wost,2021-03-10,,,, +2021,jetport_south,374,wost,2021-03-15,,,, +2021,jetport_south,374,wost,2021-03-22,,,, +2021,jetport_south,374,wost,2021-03-29,,,, +2021,jetport_south,374,wost,2021-04-05,3,,incubating, +2021,jetport_south,374,wost,2021-04-13,3,,incubating, +2021,jetport_south,374,wost,2021-04-19,,,missed, +2021,jetport_south,374,wost,2021-04-26,1,2,wet_chick, +2021,jetport_south,374,wost,2021-05-03,,1,nestling, +2021,jetport_south,374,wost,2021-05-10,,1,nestling, +2021,jetport_south,374,wost,2021-05-17,,,, +2021,jetport_south,374,wost,2021-05-25,,1,nestling, +2021,jetport_south,374,wost,2021-05-31,,1,nestling, +2021,jetport_south,374,wost,2021-06-07,,1,nestling, +2021,jetport_south,376,wost,2021-03-10,,,, +2021,jetport_south,376,wost,2021-03-15,,,, +2021,jetport_south,376,wost,2021-03-22,,,, +2021,jetport_south,376,wost,2021-03-29,,,, +2021,jetport_south,376,wost,2021-04-05,1,,incubating, +2021,jetport_south,376,wost,2021-04-13,3,,incubating, +2021,jetport_south,376,wost,2021-04-19,3,,incubating, +2021,jetport_south,376,wost,2021-04-26,,3,nestling, +2021,jetport_south,376,wost,2021-05-03,2,1,hatching, +2021,jetport_south,376,wost,2021-05-10,1,2,hatching, +2021,jetport_south,376,wost,2021-05-17,1,2,hatching, +2021,jetport_south,376,wost,2021-05-25,,2,nestling, +2021,jetport_south,376,wost,2021-05-31,,2,nestling, +2021,jetport_south,376,wost,2021-06-07,,2,nestling, +2021,jetport_south,378,wost,2021-03-10,,,, +2021,jetport_south,378,wost,2021-03-15,,,, +2021,jetport_south,378,wost,2021-03-22,,,, +2021,jetport_south,378,wost,2021-03-29,,,, +2021,jetport_south,378,wost,2021-04-05,3,,incubating, +2021,jetport_south,378,wost,2021-04-13,3,,incubating, +2021,jetport_south,378,wost,2021-04-19,3,,incubating, +2021,jetport_south,378,wost,2021-04-26,3,,incubating, +2021,jetport_south,378,wost,2021-05-03,,3,nestling, +2021,jetport_south,378,wost,2021-05-10,,2,nestling, +2021,jetport_south,378,wost,2021-05-17,,3,nestling, +2021,jetport_south,378,wost,2021-05-25,,2,nestling, +2021,jetport_south,378,wost,2021-05-31,,3,nestling, +2021,jetport_south,378,wost,2021-06-07,,3,nestling, +2021,jetport_south,380,wost,2021-03-10,,,,"5/31 pink drone flag" +2021,jetport_south,380,wost,2021-03-15,,,,"5/31 pink drone flag" +2021,jetport_south,380,wost,2021-03-22,,,,"5/31 pink drone flag" +2021,jetport_south,380,wost,2021-03-29,,,,"5/31 pink drone flag" +2021,jetport_south,380,wost,2021-04-05,3,,incubating,"5/31 pink drone flag" +2021,jetport_south,380,wost,2021-04-13,3,,incubating,"5/31 pink drone flag" +2021,jetport_south,380,wost,2021-04-19,3,,incubating,"5/31 pink drone flag" +2021,jetport_south,380,wost,2021-04-26,1,2,wet_chick,"5/31 pink drone flag" +2021,jetport_south,380,wost,2021-05-03,,3,nestling,"5/31 pink drone flag" +2021,jetport_south,380,wost,2021-05-10,,3,nestling,"5/31 pink drone flag" +2021,jetport_south,380,wost,2021-05-17,,3,nestling,"5/31 pink drone flag" +2021,jetport_south,380,wost,2021-05-25,,3,nestling,"5/31 pink drone flag" +2021,jetport_south,380,wost,2021-05-31,,3,nestling,"5/31 pink drone flag" +2021,jetport_south,380,wost,2021-06-07,,3,nestling,"5/31 pink drone flag" +2021,jetport_south,382,wost,2021-03-10,,,, +2021,jetport_south,382,wost,2021-03-15,,,, +2021,jetport_south,382,wost,2021-03-22,,,, +2021,jetport_south,382,wost,2021-03-29,,,, +2021,jetport_south,382,wost,2021-04-05,1,,incubating, +2021,jetport_south,382,wost,2021-04-13,3,,incubating, +2021,jetport_south,382,wost,2021-04-19,3,,incubating, +2021,jetport_south,382,wost,2021-04-26,3,,incubating, +2021,jetport_south,382,wost,2021-05-03,2,1,pipping, +2021,jetport_south,382,wost,2021-05-10,,3,nestling, +2021,jetport_south,382,wost,2021-05-17,,3,nestling, +2021,jetport_south,382,wost,2021-05-25,,2,nestling, +2021,jetport_south,382,wost,2021-05-31,,3,nestling, +2021,jetport_south,382,wost,2021-06-07,,3,nestling, +2021,jetport_south,747,wost,2021-03-10,,,,"4/19 orange drone flagging" +2021,jetport_south,747,wost,2021-03-15,,,,"4/19 orange drone flagging" +2021,jetport_south,747,wost,2021-03-22,,,,"4/19 orange drone flagging" +2021,jetport_south,747,wost,2021-03-29,,,,"4/19 orange drone flagging" +2021,jetport_south,747,wost,2021-04-05,,,,"4/19 orange drone flagging" +2021,jetport_south,747,wost,2021-04-13,2,,incubating,"4/19 orange drone flagging" +2021,jetport_south,747,wost,2021-04-19,2,,pipping,"4/19 orange drone flagging" +2021,jetport_south,747,wost,2021-04-26,1,1,hatching,"4/19 orange drone flagging" +2021,jetport_south,747,wost,2021-05-03,,2,nestling,"4/19 orange drone flagging" +2021,jetport_south,747,wost,2021-05-10,,2,nestling,"4/19 orange drone flagging" +2021,jetport_south,747,wost,2021-05-17,,2,nestling,"4/19 orange drone flagging" +2021,jetport_south,747,wost,2021-05-25,,2,nestling,"4/19 orange drone flagging" +2021,jetport_south,747,wost,2021-05-31,,1,nestling,"4/19 orange drone flagging" +2021,jetport_south,747,wost,2021-06-07,,1,nestling,"4/19 orange drone flagging" +2021,jetport_south,749,wost,2021-03-10,,,,"5/3 collapsed" +2021,jetport_south,749,wost,2021-03-15,,,,"5/3 collapsed" +2021,jetport_south,749,wost,2021-03-22,,,,"5/3 collapsed" +2021,jetport_south,749,wost,2021-03-29,,,,"5/3 collapsed" +2021,jetport_south,749,wost,2021-04-05,,,,"5/3 collapsed" +2021,jetport_south,749,wost,2021-04-13,3,,incubating,"5/3 collapsed" +2021,jetport_south,749,wost,2021-04-19,3,,incubating,"5/3 collapsed" +2021,jetport_south,749,wost,2021-04-26,3,,incubating,"5/3 collapsed" +2021,jetport_south,749,wost,2021-05-03,0,,empty,"5/3 collapsed" +2021,jetport_south,749,wost,2021-05-10,,,,"5/3 collapsed" +2021,jetport_south,749,wost,2021-05-17,,,,"5/3 collapsed" +2021,jetport_south,749,wost,2021-05-25,,,,"5/3 collapsed" +2021,jetport_south,749,wost,2021-05-31,,,,"5/3 collapsed" +2021,jetport_south,749,wost,2021-06-07,,,,"5/3 collapsed" +2021,jetport_south,352,wost,2021-03-10,,,,"5/17 collapsed" +2021,jetport_south,352,wost,2021-03-15,,,,"5/17 collapsed" +2021,jetport_south,352,wost,2021-03-22,,,,"5/17 collapsed" +2021,jetport_south,352,wost,2021-03-29,,,,"5/17 collapsed" +2021,jetport_south,352,wost,2021-04-05,,,,"5/17 collapsed" +2021,jetport_south,352,wost,2021-04-13,2,,incubating,"5/17 collapsed" +2021,jetport_south,352,wost,2021-04-19,2,,incubating,"5/17 collapsed" +2021,jetport_south,352,wost,2021-04-26,3,,incubating,"5/17 collapsed" +2021,jetport_south,352,wost,2021-05-03,3,,incubating,"5/17 collapsed" +2021,jetport_south,352,wost,2021-05-10,1,2,hatching,"5/17 collapsed" +2021,jetport_south,352,wost,2021-05-17,0,0,empty,"5/17 collapsed" +2021,jetport_south,352,wost,2021-05-25,,,,"5/17 collapsed" +2021,jetport_south,352,wost,2021-05-31,,,,"5/17 collapsed" +2021,jetport_south,352,wost,2021-06-07,,,,"5/17 collapsed" +2021,jetport_south,751,wost,2021-03-10,,,, +2021,jetport_south,751,wost,2021-03-15,,,, +2021,jetport_south,751,wost,2021-03-22,,,, +2021,jetport_south,751,wost,2021-03-29,,,, +2021,jetport_south,751,wost,2021-04-05,,,, +2021,jetport_south,751,wost,2021-04-13,3,,incubating, +2021,jetport_south,751,wost,2021-04-19,3,,incubating, +2021,jetport_south,751,wost,2021-04-26,3,,incubating, +2021,jetport_south,751,wost,2021-05-03,3,,incubating, +2021,jetport_south,751,wost,2021-05-10,,3,nestling, +2021,jetport_south,751,wost,2021-05-17,,3,nestling, +2021,jetport_south,751,wost,2021-05-25,,3,nestling, +2021,jetport_south,751,wost,2021-05-31,,3,nestling, +2021,jetport_south,751,wost,2021-06-07,,3,nestling, +2021,jetport_south,354,wost,2021-03-10,,,,"6/7: pink drone flag" +2021,jetport_south,354,wost,2021-03-15,,,,"6/7: pink drone flag" +2021,jetport_south,354,wost,2021-03-22,,,,"6/7: pink drone flag" +2021,jetport_south,354,wost,2021-03-29,,,,"6/7: pink drone flag" +2021,jetport_south,354,wost,2021-04-05,,,,"6/7: pink drone flag" +2021,jetport_south,354,wost,2021-04-13,3,,incubating,"6/7: pink drone flag" +2021,jetport_south,354,wost,2021-04-19,3,,incubating,"6/7: pink drone flag" +2021,jetport_south,354,wost,2021-04-26,3,,incubating,"6/7: pink drone flag" +2021,jetport_south,354,wost,2021-05-03,3,,incubating,"6/7: pink drone flag" +2021,jetport_south,354,wost,2021-05-10,,2,nestling,"6/7: pink drone flag" +2021,jetport_south,354,wost,2021-05-17,,1,nestling,"6/7: pink drone flag" +2021,jetport_south,354,wost,2021-05-25,,3,nestling,"6/7: pink drone flag" +2021,jetport_south,354,wost,2021-05-31,,2,nestling,"6/7: pink drone flag" +2021,jetport_south,354,wost,2021-06-07,,2,nestling,"6/7: pink drone flag" +2021,jetport_south,753,wost,2021-03-10,,,, +2021,jetport_south,753,wost,2021-03-15,,,, +2021,jetport_south,753,wost,2021-03-22,,,, +2021,jetport_south,753,wost,2021-03-29,,,, +2021,jetport_south,753,wost,2021-04-05,,,, +2021,jetport_south,753,wost,2021-04-13,1,,incubating, +2021,jetport_south,753,wost,2021-04-19,2,,incubating, +2021,jetport_south,753,wost,2021-04-26,2,,incubating, +2021,jetport_south,753,wost,2021-05-03,2,,incubating, +2021,jetport_south,753,wost,2021-05-10,0,,empty, +2021,jetport_south,753,wost,2021-05-17,,,, +2021,jetport_south,753,wost,2021-05-25,,,, +2021,jetport_south,753,wost,2021-05-31,,,, +2021,jetport_south,753,wost,2021-06-07,,,, +2021,jetport_south,777,wost,2021-03-10,,,,"4/19 orange drone flagging; 6/7: blue drone flag" +2021,jetport_south,777,wost,2021-03-15,,,,"4/19 orange drone flagging; 6/7: blue drone flag" +2021,jetport_south,777,wost,2021-03-22,,,,"4/19 orange drone flagging; 6/7: blue drone flag" +2021,jetport_south,777,wost,2021-03-29,,,,"4/19 orange drone flagging; 6/7: blue drone flag" +2021,jetport_south,777,wost,2021-04-05,,,,"4/19 orange drone flagging; 6/7: blue drone flag" +2021,jetport_south,777,wost,2021-04-13,,,,"4/19 orange drone flagging; 6/7: blue drone flag" +2021,jetport_south,777,wost,2021-04-19,3,,incubating,"4/19 orange drone flagging; 6/7: blue drone flag" +2021,jetport_south,777,wost,2021-04-26,3,,incubating,"4/19 orange drone flagging; 6/7: blue drone flag" +2021,jetport_south,777,wost,2021-05-03,2,1,hatching,"4/19 orange drone flagging; 6/7: blue drone flag" +2021,jetport_south,777,wost,2021-05-10,,3,nestling,"4/19 orange drone flagging; 6/7: blue drone flag" +2021,jetport_south,777,wost,2021-05-17,,2,nestling,"4/19 orange drone flagging; 6/7: blue drone flag" +2021,jetport_south,777,wost,2021-05-25,,2,nestling,"4/19 orange drone flagging; 6/7: blue drone flag" +2021,jetport_south,777,wost,2021-05-31,,2,nestling,"4/19 orange drone flagging; 6/7: blue drone flag" +2021,jetport_south,777,wost,2021-06-07,,2,nestling,"4/19 orange drone flagging; 6/7: blue drone flag" +2021,jetport_south,779,wost,2021-03-10,,,,"5/17: 3+" +2021,jetport_south,779,wost,2021-03-15,,,,"5/17: 3+" +2021,jetport_south,779,wost,2021-03-22,,,,"5/17: 3+" +2021,jetport_south,779,wost,2021-03-29,,,,"5/17: 3+" +2021,jetport_south,779,wost,2021-04-05,,,,"5/17: 3+" +2021,jetport_south,779,wost,2021-04-13,,,,"5/17: 3+" +2021,jetport_south,779,wost,2021-04-19,4,,incubating,"5/17: 3+" +2021,jetport_south,779,wost,2021-04-26,4,,incubating,"5/17: 3+" +2021,jetport_south,779,wost,2021-05-03,4,,incubating,"5/17: 3+" +2021,jetport_south,779,wost,2021-05-10,2,2,hatching,"5/17: 3+" +2021,jetport_south,779,wost,2021-05-17,,3,nestling,"5/17: 3+" +2021,jetport_south,779,wost,2021-05-25,,2,nestling,"5/17: 3+" +2021,jetport_south,779,wost,2021-05-31,,3,nestling,"5/17: 3+" +2021,jetport_south,779,wost,2021-06-07,,3,nestling,"5/17: 3+" +2021,jetport_south,781,wost,2021-03-10,,,, +2021,jetport_south,781,wost,2021-03-15,,,, +2021,jetport_south,781,wost,2021-03-22,,,, +2021,jetport_south,781,wost,2021-03-29,,,, +2021,jetport_south,781,wost,2021-04-05,,,, +2021,jetport_south,781,wost,2021-04-13,,,, +2021,jetport_south,781,wost,2021-04-19,3,,incubating, +2021,jetport_south,781,wost,2021-04-26,3,,incubating, +2021,jetport_south,781,wost,2021-05-03,1,2,hatching, +2021,jetport_south,781,wost,2021-05-10,,3,nestling, +2021,jetport_south,781,wost,2021-05-17,,2,nestling, +2021,jetport_south,781,wost,2021-05-25,,2,nestling, +2021,jetport_south,781,wost,2021-05-31,,3,nestling, +2021,jetport_south,781,wost,2021-06-07,,3,nestling, +2021,jetport_south,783,wost,2021-03-10,,,, +2021,jetport_south,783,wost,2021-03-15,,,, +2021,jetport_south,783,wost,2021-03-22,,,, +2021,jetport_south,783,wost,2021-03-29,,,, +2021,jetport_south,783,wost,2021-04-05,,,, +2021,jetport_south,783,wost,2021-04-13,,,, +2021,jetport_south,783,wost,2021-04-19,3,,incubating, +2021,jetport_south,783,wost,2021-04-26,3,,incubating, +2021,jetport_south,783,wost,2021-05-03,3,,incubating, +2021,jetport_south,783,wost,2021-05-10,,3,nestling, +2021,jetport_south,783,wost,2021-05-17,,,missed, +2021,jetport_south,783,wost,2021-05-25,,1,nestling, +2021,jetport_south,783,wost,2021-05-31,,1,nestling, +2021,jetport_south,783,wost,2021-06-07,,1,nestling, +2021,jetport_south,785,wost,2021-03-10,,,,"5/31 nest collapsed; pink drone flag" +2021,jetport_south,785,wost,2021-03-15,,,,"5/31 nest collapsed; pink drone flag" +2021,jetport_south,785,wost,2021-03-22,,,,"5/31 nest collapsed; pink drone flag" +2021,jetport_south,785,wost,2021-03-29,,,,"5/31 nest collapsed; pink drone flag" +2021,jetport_south,785,wost,2021-04-05,,,,"5/31 nest collapsed; pink drone flag" +2021,jetport_south,785,wost,2021-04-13,,,,"5/31 nest collapsed; pink drone flag" +2021,jetport_south,785,wost,2021-04-19,3,,incubating,"5/31 nest collapsed; pink drone flag" +2021,jetport_south,785,wost,2021-04-26,3,,incubating,"5/31 nest collapsed; pink drone flag" +2021,jetport_south,785,wost,2021-05-03,3,,incubating,"5/31 nest collapsed; pink drone flag" +2021,jetport_south,785,wost,2021-05-10,2,1,hatching,"5/31 nest collapsed; pink drone flag" +2021,jetport_south,785,wost,2021-05-17,2,,incubating,"5/31 nest collapsed; pink drone flag" +2021,jetport_south,785,wost,2021-05-25,2,,incubating,"5/31 nest collapsed; pink drone flag" +2021,jetport_south,785,wost,2021-05-31,,0,empty,"5/31 nest collapsed; pink drone flag" +2021,jetport_south,785,wost,2021-06-07,,,,"5/31 nest collapsed; pink drone flag" +2021,jetport_south,787,wost,2021-03-10,,,,"4/26 collapsed" +2021,jetport_south,787,wost,2021-03-15,,,,"4/26 collapsed" +2021,jetport_south,787,wost,2021-03-22,,,,"4/26 collapsed" +2021,jetport_south,787,wost,2021-03-29,,,,"4/26 collapsed" +2021,jetport_south,787,wost,2021-04-05,,,,"4/26 collapsed" +2021,jetport_south,787,wost,2021-04-13,,,,"4/26 collapsed" +2021,jetport_south,787,wost,2021-04-19,3,,incubating,"4/26 collapsed" +2021,jetport_south,787,wost,2021-04-26,0,,empty,"4/26 collapsed" +2021,jetport_south,787,wost,2021-05-03,,,,"4/26 collapsed" +2021,jetport_south,787,wost,2021-05-10,,,,"4/26 collapsed" +2021,jetport_south,787,wost,2021-05-17,,,,"4/26 collapsed" +2021,jetport_south,787,wost,2021-05-25,,,,"4/26 collapsed" +2021,jetport_south,787,wost,2021-05-31,,,,"4/26 collapsed" +2021,jetport_south,787,wost,2021-06-07,,,,"4/26 collapsed" +2021,jetport_south,789,wost,2021-03-10,,,, +2021,jetport_south,789,wost,2021-03-15,,,, +2021,jetport_south,789,wost,2021-03-22,,,, +2021,jetport_south,789,wost,2021-03-29,,,, +2021,jetport_south,789,wost,2021-04-05,,,, +2021,jetport_south,789,wost,2021-04-13,,,, +2021,jetport_south,789,wost,2021-04-19,2,,incubating, +2021,jetport_south,789,wost,2021-04-26,3,,incubating, +2021,jetport_south,789,wost,2021-05-03,3,,incubating, +2021,jetport_south,789,wost,2021-05-10,1,2,hatching, +2021,jetport_south,789,wost,2021-05-17,,1,nestling, +2021,jetport_south,789,wost,2021-05-25,,2,nestling, +2021,jetport_south,789,wost,2021-05-31,,2,nestling, +2021,jetport_south,789,wost,2021-06-07,,1,nestling, +2021,jetport_south,791,wost,2021-03-10,,,, +2021,jetport_south,791,wost,2021-03-15,,,, +2021,jetport_south,791,wost,2021-03-22,,,, +2021,jetport_south,791,wost,2021-03-29,,,, +2021,jetport_south,791,wost,2021-04-05,,,, +2021,jetport_south,791,wost,2021-04-13,,,, +2021,jetport_south,791,wost,2021-04-19,3,,incubating, +2021,jetport_south,791,wost,2021-04-26,3,,incubating, +2021,jetport_south,791,wost,2021-05-03,3,,incubating, +2021,jetport_south,791,wost,2021-05-10,1,2,hatching, +2021,jetport_south,791,wost,2021-05-17,,2,nestling, +2021,jetport_south,791,wost,2021-05-25,,2,nestling, +2021,jetport_south,791,wost,2021-05-31,,2,nestling, +2021,jetport_south,791,wost,2021-06-07,,2,nestling, +2021,jetport_south,793,wost,2021-03-10,,,,"5/10 nest collapsed" +2021,jetport_south,793,wost,2021-03-15,,,,"5/10 nest collapsed" +2021,jetport_south,793,wost,2021-03-22,,,,"5/10 nest collapsed" +2021,jetport_south,793,wost,2021-03-29,,,,"5/10 nest collapsed" +2021,jetport_south,793,wost,2021-04-05,,,,"5/10 nest collapsed" +2021,jetport_south,793,wost,2021-04-13,,,,"5/10 nest collapsed" +2021,jetport_south,793,wost,2021-04-19,2,,incubating,"5/10 nest collapsed" +2021,jetport_south,793,wost,2021-04-26,1,1,hatching,"5/10 nest collapsed" +2021,jetport_south,793,wost,2021-05-03,0,0,empty,"5/10 nest collapsed" +2021,jetport_south,793,wost,2021-05-10,,,,"5/10 nest collapsed" +2021,jetport_south,793,wost,2021-05-17,,,,"5/10 nest collapsed" +2021,jetport_south,793,wost,2021-05-25,,,,"5/10 nest collapsed" +2021,jetport_south,793,wost,2021-05-31,,,,"5/10 nest collapsed" +2021,jetport_south,793,wost,2021-06-07,,,,"5/10 nest collapsed" +2021,jetport_south,795,wost,2021-03-10,,,, +2021,jetport_south,795,wost,2021-03-15,,,, +2021,jetport_south,795,wost,2021-03-22,,,, +2021,jetport_south,795,wost,2021-03-29,,,, +2021,jetport_south,795,wost,2021-04-05,,,, +2021,jetport_south,795,wost,2021-04-13,,,, +2021,jetport_south,795,wost,2021-04-19,2,,incubating, +2021,jetport_south,795,wost,2021-04-26,3,,incubating, +2021,jetport_south,795,wost,2021-05-03,1,2,hatching, +2021,jetport_south,795,wost,2021-05-10,0,0,empty, +2021,jetport_south,795,wost,2021-05-17,,,, +2021,jetport_south,795,wost,2021-05-25,,,, +2021,jetport_south,795,wost,2021-05-31,,,, +2021,jetport_south,795,wost,2021-06-07,,,, +2021,jetport_south,797,wost,2021-03-10,,,, +2021,jetport_south,797,wost,2021-03-15,,,, +2021,jetport_south,797,wost,2021-03-22,,,, +2021,jetport_south,797,wost,2021-03-29,,,, +2021,jetport_south,797,wost,2021-04-05,,,, +2021,jetport_south,797,wost,2021-04-13,,,, +2021,jetport_south,797,wost,2021-04-19,2,,incubating, +2021,jetport_south,797,wost,2021-04-26,3,,incubating, +2021,jetport_south,797,wost,2021-05-03,3,,incubating, +2021,jetport_south,797,wost,2021-05-10,2,1,hatching, +2021,jetport_south,797,wost,2021-05-17,,2,nestling, +2021,jetport_south,797,wost,2021-05-25,,3,nestling, +2021,jetport_south,797,wost,2021-05-31,,3,nestling, +2021,jetport_south,797,wost,2021-06-07,,3,nestling, +2021,jetport_south,648,wost,2021-03-10,,,,"5/3 collapsed, 5/25 flagged L +Enst- blue" +2021,jetport_south,648,wost,2021-03-15,,,,"5/3 collapsed, 5/25 flagged L +Enst- blue" +2021,jetport_south,648,wost,2021-03-22,,,,"5/3 collapsed, 5/25 flagged L +Enst- blue" +2021,jetport_south,648,wost,2021-03-29,,,,"5/3 collapsed, 5/25 flagged L +Enst- blue" +2021,jetport_south,648,wost,2021-04-05,,,,"5/3 collapsed, 5/25 flagged L +Enst- blue" +2021,jetport_south,648,wost,2021-04-13,,,,"5/3 collapsed, 5/25 flagged L +Enst- blue" +2021,jetport_south,648,wost,2021-04-19,,,,"5/3 collapsed, 5/25 flagged L +Enst- blue" +2021,jetport_south,648,wost,2021-04-26,3,,incubating,"5/3 collapsed, 5/25 flagged L +Enst- blue" +2021,jetport_south,648,wost,2021-05-03,0,,empty,"5/3 collapsed, 5/25 flagged L +Enst- blue" +2021,jetport_south,648,wost,2021-05-10,,,,"5/3 collapsed, 5/25 flagged L +Enst- blue" +2021,jetport_south,648,wost,2021-05-17,,,,"5/3 collapsed, 5/25 flagged L +Enst- blue" +2021,jetport_south,648,wost,2021-05-25,,,,"5/3 collapsed, 5/25 flagged L +Enst- blue" +2021,jetport_south,648,wost,2021-05-31,,,,"5/3 collapsed, 5/25 flagged L +Enst- blue" +2021,jetport_south,648,wost,2021-06-07,,,,"5/3 collapsed, 5/25 flagged L +Enst- blue" +2021,jetport_south,650,wost,2021-03-10,,,,"5/17: 2+" +2021,jetport_south,650,wost,2021-03-15,,,,"5/17: 2+" +2021,jetport_south,650,wost,2021-03-22,,,,"5/17: 2+" +2021,jetport_south,650,wost,2021-03-29,,,,"5/17: 2+" +2021,jetport_south,650,wost,2021-04-05,,,,"5/17: 2+" +2021,jetport_south,650,wost,2021-04-13,,,,"5/17: 2+" +2021,jetport_south,650,wost,2021-04-19,,,,"5/17: 2+" +2021,jetport_south,650,wost,2021-04-26,3,,incubating,"5/17: 2+" +2021,jetport_south,650,wost,2021-05-03,1,2,hatching,"5/17: 2+" +2021,jetport_south,650,wost,2021-05-10,,3,nestling,"5/17: 2+" +2021,jetport_south,650,wost,2021-05-17,,2,nestling,"5/17: 2+" +2021,jetport_south,650,wost,2021-05-25,,2,nestling,"5/17: 2+" +2021,jetport_south,650,wost,2021-05-31,,2,nestling,"5/17: 2+" +2021,jetport_south,650,wost,2021-06-07,,2,nestling,"5/17: 2+" +2021,jetport_south,652,wost,2021-03-10,,,, +2021,jetport_south,652,wost,2021-03-15,,,, +2021,jetport_south,652,wost,2021-03-22,,,, +2021,jetport_south,652,wost,2021-03-29,,,, +2021,jetport_south,652,wost,2021-04-05,,,, +2021,jetport_south,652,wost,2021-04-13,,,, +2021,jetport_south,652,wost,2021-04-19,,,, +2021,jetport_south,652,wost,2021-04-26,2,,incubating, +2021,jetport_south,652,wost,2021-05-03,,2,nestling, +2021,jetport_south,652,wost,2021-05-10,,2,nestling, +2021,jetport_south,652,wost,2021-05-17,,2,nestling, +2021,jetport_south,652,wost,2021-05-25,,1,nestling, +2021,jetport_south,652,wost,2021-05-31,,2,nestling, +2021,jetport_south,652,wost,2021-06-07,,,missed, +2021,jetport_south,654,wost,2021-03-10,,,, +2021,jetport_south,654,wost,2021-03-15,,,, +2021,jetport_south,654,wost,2021-03-22,,,, +2021,jetport_south,654,wost,2021-03-29,,,, +2021,jetport_south,654,wost,2021-04-05,,,, +2021,jetport_south,654,wost,2021-04-13,,,, +2021,jetport_south,654,wost,2021-04-19,,,, +2021,jetport_south,654,wost,2021-04-26,3,,incubating, +2021,jetport_south,654,wost,2021-05-03,1,2,hatching, +2021,jetport_south,654,wost,2021-05-10,1,2,hatching, +2021,jetport_south,654,wost,2021-05-17,,3,nestling, +2021,jetport_south,654,wost,2021-05-25,,2,nestling, +2021,jetport_south,654,wost,2021-05-31,,2,nestling, +2021,jetport_south,654,wost,2021-06-07,,,missed, +2021,jetport_south,656,wost,2021-03-10,,,, +2021,jetport_south,656,wost,2021-03-15,,,, +2021,jetport_south,656,wost,2021-03-22,,,, +2021,jetport_south,656,wost,2021-03-29,,,, +2021,jetport_south,656,wost,2021-04-05,,,, +2021,jetport_south,656,wost,2021-04-13,,,, +2021,jetport_south,656,wost,2021-04-19,,,, +2021,jetport_south,656,wost,2021-04-26,2,,incubating, +2021,jetport_south,656,wost,2021-05-03,2,,incubating, +2021,jetport_south,656,wost,2021-05-10,1,1,hatching, +2021,jetport_south,656,wost,2021-05-17,1,1,hatching, +2021,jetport_south,656,wost,2021-05-25,1,1,hatching, +2021,jetport_south,656,wost,2021-05-31,,1,nestling, +2021,jetport_south,656,wost,2021-06-07,,,missed, +2021,jetport_south,658,wost,2021-03-10,,,, +2021,jetport_south,658,wost,2021-03-15,,,, +2021,jetport_south,658,wost,2021-03-22,,,, +2021,jetport_south,658,wost,2021-03-29,,,, +2021,jetport_south,658,wost,2021-04-05,,,, +2021,jetport_south,658,wost,2021-04-13,,,, +2021,jetport_south,658,wost,2021-04-19,,,, +2021,jetport_south,658,wost,2021-04-26,4,,incubating, +2021,jetport_south,658,wost,2021-05-03,3,1,hatching, +2021,jetport_south,658,wost,2021-05-10,,3,nestling, +2021,jetport_south,658,wost,2021-05-17,,3,nestling, +2021,jetport_south,658,wost,2021-05-25,,3,nestling, +2021,jetport_south,658,wost,2021-05-31,,2,nestling, +2021,jetport_south,658,wost,2021-06-07,,,missed, +2021,jetport_south,660,wost,2021-03-10,,,, +2021,jetport_south,660,wost,2021-03-15,,,, +2021,jetport_south,660,wost,2021-03-22,,,, +2021,jetport_south,660,wost,2021-03-29,,,, +2021,jetport_south,660,wost,2021-04-05,,,, +2021,jetport_south,660,wost,2021-04-13,,,, +2021,jetport_south,660,wost,2021-04-19,,,, +2021,jetport_south,660,wost,2021-04-26,3,,incubating, +2021,jetport_south,660,wost,2021-05-03,3,,pipping, +2021,jetport_south,660,wost,2021-05-10,,3,nestling, +2021,jetport_south,660,wost,2021-05-17,,3,nestling, +2021,jetport_south,660,wost,2021-05-25,,3,nestling, +2021,jetport_south,660,wost,2021-05-31,,3,nestling, +2021,jetport_south,660,wost,2021-06-07,,2,nestling, +2021,jetport_south,662,wost,2021-03-10,,,,"5/10 nest collapsed & 3 eggs on ground" +2021,jetport_south,662,wost,2021-03-15,,,,"5/10 nest collapsed & 3 eggs on ground" +2021,jetport_south,662,wost,2021-03-22,,,,"5/10 nest collapsed & 3 eggs on ground" +2021,jetport_south,662,wost,2021-03-29,,,,"5/10 nest collapsed & 3 eggs on ground" +2021,jetport_south,662,wost,2021-04-05,,,,"5/10 nest collapsed & 3 eggs on ground" +2021,jetport_south,662,wost,2021-04-13,,,,"5/10 nest collapsed & 3 eggs on ground" +2021,jetport_south,662,wost,2021-04-19,,,,"5/10 nest collapsed & 3 eggs on ground" +2021,jetport_south,662,wost,2021-04-26,3,,incubating,"5/10 nest collapsed & 3 eggs on ground" +2021,jetport_south,662,wost,2021-05-03,3,,incubating,"5/10 nest collapsed & 3 eggs on ground" +2021,jetport_south,662,wost,2021-05-10,0,,empty,"5/10 nest collapsed & 3 eggs on ground" +2021,jetport_south,662,wost,2021-05-17,,,,"5/10 nest collapsed & 3 eggs on ground" +2021,jetport_south,662,wost,2021-05-25,,,,"5/10 nest collapsed & 3 eggs on ground" +2021,jetport_south,662,wost,2021-05-31,,,,"5/10 nest collapsed & 3 eggs on ground" +2021,jetport_south,662,wost,2021-06-07,,,,"5/10 nest collapsed & 3 eggs on ground" +2021,jetport_south,664,wost,2021-03-10,,,, +2021,jetport_south,664,wost,2021-03-15,,,, +2021,jetport_south,664,wost,2021-03-22,,,, +2021,jetport_south,664,wost,2021-03-29,,,, +2021,jetport_south,664,wost,2021-04-05,,,, +2021,jetport_south,664,wost,2021-04-13,,,, +2021,jetport_south,664,wost,2021-04-19,,,, +2021,jetport_south,664,wost,2021-04-26,2,,incubating, +2021,jetport_south,664,wost,2021-05-03,3,,incubating, +2021,jetport_south,664,wost,2021-05-10,,3,hatching, +2021,jetport_south,664,wost,2021-05-17,,3,nestling, +2021,jetport_south,664,wost,2021-05-25,,3,nestling, +2021,jetport_south,664,wost,2021-05-31,,3,nestling, +2021,jetport_south,664,wost,2021-06-07,,3,nestling, +2021,jetport_south,666,wost,2021-03-10,,,, +2021,jetport_south,666,wost,2021-03-15,,,, +2021,jetport_south,666,wost,2021-03-22,,,, +2021,jetport_south,666,wost,2021-03-29,,,, +2021,jetport_south,666,wost,2021-04-05,,,, +2021,jetport_south,666,wost,2021-04-13,,,, +2021,jetport_south,666,wost,2021-04-19,,,, +2021,jetport_south,666,wost,2021-04-26,3,,incubating, +2021,jetport_south,666,wost,2021-05-03,,3,nestling, +2021,jetport_south,666,wost,2021-05-10,,2,nestling, +2021,jetport_south,666,wost,2021-05-17,,2,nestling, +2021,jetport_south,666,wost,2021-05-25,,2,nestling, +2021,jetport_south,666,wost,2021-05-31,,2,nestling, +2021,jetport_south,666,wost,2021-06-07,,2,fledged, +2021,jetport_south,668,wost,2021-03-10,,,, +2021,jetport_south,668,wost,2021-03-15,,,, +2021,jetport_south,668,wost,2021-03-22,,,, +2021,jetport_south,668,wost,2021-03-29,,,, +2021,jetport_south,668,wost,2021-04-05,,,, +2021,jetport_south,668,wost,2021-04-13,,,, +2021,jetport_south,668,wost,2021-04-19,,,, +2021,jetport_south,668,wost,2021-04-26,3,,incubating, +2021,jetport_south,668,wost,2021-05-03,3,,incubating, +2021,jetport_south,668,wost,2021-05-10,,3,nestling, +2021,jetport_south,668,wost,2021-05-17,,2,nestling, +2021,jetport_south,668,wost,2021-05-25,,2,nestling, +2021,jetport_south,668,wost,2021-05-31,,1,nestling, +2021,jetport_south,668,wost,2021-06-07,,2,nestling, +2021,jetport_south,670,wost,2021-03-10,,,,"5/31 orange drone flag" +2021,jetport_south,670,wost,2021-03-15,,,,"5/31 orange drone flag" +2021,jetport_south,670,wost,2021-03-22,,,,"5/31 orange drone flag" +2021,jetport_south,670,wost,2021-03-29,,,,"5/31 orange drone flag" +2021,jetport_south,670,wost,2021-04-05,,,,"5/31 orange drone flag" +2021,jetport_south,670,wost,2021-04-13,,,,"5/31 orange drone flag" +2021,jetport_south,670,wost,2021-04-19,,,,"5/31 orange drone flag" +2021,jetport_south,670,wost,2021-04-26,3,,incubating,"5/31 orange drone flag" +2021,jetport_south,670,wost,2021-05-03,3,,incubating,"5/31 orange drone flag" +2021,jetport_south,670,wost,2021-05-10,1,2,hatching,"5/31 orange drone flag" +2021,jetport_south,670,wost,2021-05-17,,,missed,"5/31 orange drone flag" +2021,jetport_south,670,wost,2021-05-25,,2,nestling,"5/31 orange drone flag" +2021,jetport_south,670,wost,2021-05-31,,2,nestling,"5/31 orange drone flag" +2021,jetport_south,670,wost,2021-06-07,,2,nestling,"5/31 orange drone flag" +2021,jetport_south,672,wost,2021-03-10,,,, +2021,jetport_south,672,wost,2021-03-15,,,, +2021,jetport_south,672,wost,2021-03-22,,,, +2021,jetport_south,672,wost,2021-03-29,,,, +2021,jetport_south,672,wost,2021-04-05,,,, +2021,jetport_south,672,wost,2021-04-13,,,, +2021,jetport_south,672,wost,2021-04-19,,,, +2021,jetport_south,672,wost,2021-04-26,3,,incubating, +2021,jetport_south,672,wost,2021-05-03,3,,incubating, +2021,jetport_south,672,wost,2021-05-10,,,missed, +2021,jetport_south,672,wost,2021-05-17,,,missed, +2021,jetport_south,672,wost,2021-05-25,,3,nestling, +2021,jetport_south,672,wost,2021-05-31,,2,nestling, +2021,jetport_south,672,wost,2021-06-07,,3,nestling, +2021,jetport_south,676,wost,2021-03-10,,,,"5/17: nest collapsing, 5/25 nest collapsed" +2021,jetport_south,676,wost,2021-03-15,,,,"5/17: nest collapsing, 5/25 nest collapsed" +2021,jetport_south,676,wost,2021-03-22,,,,"5/17: nest collapsing, 5/25 nest collapsed" +2021,jetport_south,676,wost,2021-03-29,,,,"5/17: nest collapsing, 5/25 nest collapsed" +2021,jetport_south,676,wost,2021-04-05,,,,"5/17: nest collapsing, 5/25 nest collapsed" +2021,jetport_south,676,wost,2021-04-13,,,,"5/17: nest collapsing, 5/25 nest collapsed" +2021,jetport_south,676,wost,2021-04-19,,,,"5/17: nest collapsing, 5/25 nest collapsed" +2021,jetport_south,676,wost,2021-04-26,,,,"5/17: nest collapsing, 5/25 nest collapsed" +2021,jetport_south,676,wost,2021-05-03,2,,incubating,"5/17: nest collapsing, 5/25 nest collapsed" +2021,jetport_south,676,wost,2021-05-10,2,,incubating,"5/17: nest collapsing, 5/25 nest collapsed" +2021,jetport_south,676,wost,2021-05-17,1,,incubating,"5/17: nest collapsing, 5/25 nest collapsed" +2021,jetport_south,676,wost,2021-05-25,,0,empty,"5/17: nest collapsing, 5/25 nest collapsed" +2021,jetport_south,676,wost,2021-05-31,,,,"5/17: nest collapsing, 5/25 nest collapsed" +2021,jetport_south,676,wost,2021-06-07,,,,"5/17: nest collapsing, 5/25 nest collapsed" +2021,jetport_south,678,wost,2021-03-10,,,, +2021,jetport_south,678,wost,2021-03-15,,,, +2021,jetport_south,678,wost,2021-03-22,,,, +2021,jetport_south,678,wost,2021-03-29,,,, +2021,jetport_south,678,wost,2021-04-05,,,, +2021,jetport_south,678,wost,2021-04-13,,,, +2021,jetport_south,678,wost,2021-04-19,,,, +2021,jetport_south,678,wost,2021-04-26,,,, +2021,jetport_south,678,wost,2021-05-03,3,,incubating, +2021,jetport_south,678,wost,2021-05-10,,2,nestling, +2021,jetport_south,678,wost,2021-05-17,,2,nestling, +2021,jetport_south,678,wost,2021-05-25,,2,nestling, +2021,jetport_south,678,wost,2021-05-31,,2,nestling, +2021,jetport_south,678,wost,2021-06-07,,2,nestling, +2021,jetport_south,680,wost,2021-03-10,,,, +2021,jetport_south,680,wost,2021-03-15,,,, +2021,jetport_south,680,wost,2021-03-22,,,, +2021,jetport_south,680,wost,2021-03-29,,,, +2021,jetport_south,680,wost,2021-04-05,,,, +2021,jetport_south,680,wost,2021-04-13,,,, +2021,jetport_south,680,wost,2021-04-19,,,, +2021,jetport_south,680,wost,2021-04-26,,,, +2021,jetport_south,680,wost,2021-05-03,3,,incubating, +2021,jetport_south,680,wost,2021-05-10,,3,nestling, +2021,jetport_south,680,wost,2021-05-17,,3,nestling, +2021,jetport_south,680,wost,2021-05-25,,2,nestling, +2021,jetport_south,680,wost,2021-05-31,,2,nestling, +2021,jetport_south,680,wost,2021-06-07,,,missed, +2021,jetport_south,682,wost,2021-03-10,,,,"5/17 collapsed" +2021,jetport_south,682,wost,2021-03-15,,,,"5/17 collapsed" +2021,jetport_south,682,wost,2021-03-22,,,,"5/17 collapsed" +2021,jetport_south,682,wost,2021-03-29,,,,"5/17 collapsed" +2021,jetport_south,682,wost,2021-04-05,,,,"5/17 collapsed" +2021,jetport_south,682,wost,2021-04-13,,,,"5/17 collapsed" +2021,jetport_south,682,wost,2021-04-19,,,,"5/17 collapsed" +2021,jetport_south,682,wost,2021-04-26,,,,"5/17 collapsed" +2021,jetport_south,682,wost,2021-05-03,4,,incubating,"5/17 collapsed" +2021,jetport_south,682,wost,2021-05-10,2,2,hatching,"5/17 collapsed" +2021,jetport_south,682,wost,2021-05-17,0,0,empty,"5/17 collapsed" +2021,jetport_south,682,wost,2021-05-25,,,,"5/17 collapsed" +2021,jetport_south,682,wost,2021-05-31,,,,"5/17 collapsed" +2021,jetport_south,682,wost,2021-06-07,,,,"5/17 collapsed" +2021,jetport_south,684,wost,2021-03-10,,,,"5/31 blue drone flag" +2021,jetport_south,684,wost,2021-03-15,,,,"5/31 blue drone flag" +2021,jetport_south,684,wost,2021-03-22,,,,"5/31 blue drone flag" +2021,jetport_south,684,wost,2021-03-29,,,,"5/31 blue drone flag" +2021,jetport_south,684,wost,2021-04-05,,,,"5/31 blue drone flag" +2021,jetport_south,684,wost,2021-04-13,,,,"5/31 blue drone flag" +2021,jetport_south,684,wost,2021-04-19,,,,"5/31 blue drone flag" +2021,jetport_south,684,wost,2021-04-26,,,,"5/31 blue drone flag" +2021,jetport_south,684,wost,2021-05-03,3,,incubating,"5/31 blue drone flag" +2021,jetport_south,684,wost,2021-05-10,,3,nestling,"5/31 blue drone flag" +2021,jetport_south,684,wost,2021-05-17,,3,nestling,"5/31 blue drone flag" +2021,jetport_south,684,wost,2021-05-25,,3,nestling,"5/31 blue drone flag" +2021,jetport_south,684,wost,2021-05-31,,3,nestling,"5/31 blue drone flag" +2021,jetport_south,684,wost,2021-06-07,,3,nestling,"5/31 blue drone flag" +2021,jetport_south,686,wost,2021-03-10,,,, +2021,jetport_south,686,wost,2021-03-15,,,, +2021,jetport_south,686,wost,2021-03-22,,,, +2021,jetport_south,686,wost,2021-03-29,,,, +2021,jetport_south,686,wost,2021-04-05,,,, +2021,jetport_south,686,wost,2021-04-13,,,, +2021,jetport_south,686,wost,2021-04-19,,,, +2021,jetport_south,686,wost,2021-04-26,,,, +2021,jetport_south,686,wost,2021-05-03,3,,incubating, +2021,jetport_south,686,wost,2021-05-10,,,missed, +2021,jetport_south,686,wost,2021-05-17,,,, +2021,jetport_south,686,wost,2021-05-25,2,1,hatching, +2021,jetport_south,686,wost,2021-05-31,2,1,hatching, +2021,jetport_south,686,wost,2021-06-07,,1,nestling, +2021,hidden,579,whib,2021-03-24,1,,incubating, +2021,hidden,579,whib,2021-03-31,3,,incubating, +2021,hidden,579,whib,2021-04-07,3,,incubating, +2021,hidden,579,whib,2021-04-15,2,1,hatching, +2021,hidden,579,whib,2021-04-21,1,2,hatching, +2021,hidden,579,whib,2021-04-28,,1,nestling, +2021,hidden,581,whib,2021-03-24,2,,incubating, +2021,hidden,581,whib,2021-03-31,2,,incubating, +2021,hidden,581,whib,2021-04-07,2,,incubating, +2021,hidden,581,whib,2021-04-15,1,1,hatching, +2021,hidden,581,whib,2021-04-21,1,2,hatching, +2021,hidden,581,whib,2021-04-28,1,1,hatching, +2021,hidden,583,whib,2021-03-24,2,,incubating, +2021,hidden,583,whib,2021-03-31,3,,incubating, +2021,hidden,583,whib,2021-04-07,3,,incubating, +2021,hidden,583,whib,2021-04-15,1,2,pipping, +2021,hidden,583,whib,2021-04-21,,2,nestling, +2021,hidden,583,whib,2021-04-28,,2,nestling, +2021,hidden,585,whib,2021-03-24,2,,incubating, +2021,hidden,585,whib,2021-03-31,3,,incubating, +2021,hidden,585,whib,2021-04-07,3,,incubating, +2021,hidden,585,whib,2021-04-15,,3,nestling, +2021,hidden,585,whib,2021-04-21,,3,nestling, +2021,hidden,585,whib,2021-04-28,,2,nestling, +2021,hidden,587,whib,2021-03-24,3,,incubating, +2021,hidden,587,whib,2021-03-31,3,,incubating, +2021,hidden,587,whib,2021-04-07,3,,incubating, +2021,hidden,587,whib,2021-04-15,,2,nestling, +2021,hidden,587,whib,2021-04-21,,0,empty, +2021,hidden,587,whib,2021-04-28,,,, +2021,hidden,589,whib,2021-03-24,2,,incubating, +2021,hidden,589,whib,2021-03-31,3,,incubating, +2021,hidden,589,whib,2021-04-07,3,,incubating, +2021,hidden,589,whib,2021-04-15,1,2,hatching, +2021,hidden,589,whib,2021-04-21,,2,nestling, +2021,hidden,589,whib,2021-04-28,,1,nestling, +2021,hidden,566,whib,2021-03-24,0,0,pre_flagged, +2021,hidden,566,whib,2021-03-31,3,,incubating, +2021,hidden,566,whib,2021-04-07,3,,incubating, +2021,hidden,566,whib,2021-04-15,2,1,pipping, +2021,hidden,566,whib,2021-04-21,,3,nestling, +2021,hidden,566,whib,2021-04-28,,1,nestling, +2021,hidden,564,whib,2021-03-24,1,,incubating, +2021,hidden,564,whib,2021-03-31,2,,incubating, +2021,hidden,564,whib,2021-04-07,2,,incubating, +2021,hidden,564,whib,2021-04-15,,2,nestling, +2021,hidden,564,whib,2021-04-21,,2,nestling, +2021,hidden,564,whib,2021-04-28,,0,empty, +2021,hidden,562,whib,2021-03-24,1,,incubating, +2021,hidden,562,whib,2021-03-31,3,,incubating, +2021,hidden,562,whib,2021-04-07,3,,incubating, +2021,hidden,562,whib,2021-04-15,1,2,hatching, +2021,hidden,562,whib,2021-04-21,,2,nestling, +2021,hidden,562,whib,2021-04-28,,0,empty, +2021,hidden,576,whib,2021-03-24,2,,incubating, +2021,hidden,576,whib,2021-03-31,3,,incubating, +2021,hidden,576,whib,2021-04-07,3,,incubating, +2021,hidden,576,whib,2021-04-15,,3,nestling, +2021,hidden,576,whib,2021-04-21,,2,nestling, +2021,hidden,576,whib,2021-04-28,,0,empty, +2021,hidden,574,whib,2021-03-24,0,0,pre_flagged, +2021,hidden,574,whib,2021-03-31,3,,incubating, +2021,hidden,574,whib,2021-04-07,3,,incubating, +2021,hidden,574,whib,2021-04-15,3,,incubating, +2021,hidden,574,whib,2021-04-21,,3,nestling, +2021,hidden,574,whib,2021-04-28,,0,empty, +2021,hidden,572,whib,2021-03-24,3,,incubating, +2021,hidden,572,whib,2021-03-31,3,,incubating, +2021,hidden,572,whib,2021-04-07,3,,incubating, +2021,hidden,572,whib,2021-04-15,3,,incubating, +2021,hidden,572,whib,2021-04-21,3,,incubating, +2021,hidden,572,whib,2021-04-28,1,,, +2021,hidden,570,whib,2021-03-24,2,,incubating, +2021,hidden,570,whib,2021-03-31,3,,incubating, +2021,hidden,570,whib,2021-04-07,3,,incubating, +2021,hidden,570,whib,2021-04-15,1,2,pipping, +2021,hidden,570,whib,2021-04-21,,3,nestling, +2021,hidden,570,whib,2021-04-28,,0,empty, +2021,hidden,580,whib,2021-03-24,1,,incubating, +2021,hidden,580,whib,2021-03-31,3,,incubating, +2021,hidden,580,whib,2021-04-07,3,,incubating, +2021,hidden,580,whib,2021-04-15,1,2,wet_chick, +2021,hidden,580,whib,2021-04-21,,2,nestling, +2021,hidden,580,whib,2021-04-28,,2,nestling, +2021,hidden,582,whib,2021-03-24,2,,incubating, +2021,hidden,582,whib,2021-03-31,2,,incubating, +2021,hidden,582,whib,2021-04-07,2,,incubating, +2021,hidden,582,whib,2021-04-15,1,,incubating, +2021,hidden,582,whib,2021-04-21,,0,empty, +2021,hidden,582,whib,2021-04-28,,,, +2021,hidden,578,whib,2021-03-24,2,,incubating, +2021,hidden,578,whib,2021-03-31,3,,incubating, +2021,hidden,578,whib,2021-04-07,2,,incubating, +2021,hidden,578,whib,2021-04-15,1,1,hatching, +2021,hidden,578,whib,2021-04-21,,2,nestling, +2021,hidden,578,whib,2021-04-28,,0,empty, +2021,hidden,591,whib,2021-03-24,2,,incubating, +2021,hidden,591,whib,2021-03-31,2,,incubating, +2021,hidden,591,whib,2021-04-07,2,,incubating, +2021,hidden,591,whib,2021-04-15,0,,empty, +2021,hidden,591,whib,2021-04-21,,0,empty, +2021,hidden,591,whib,2021-04-28,,,, +2021,hidden,593,whib,2021-03-24,2,,incubating, +2021,hidden,593,whib,2021-03-31,2,,incubating, +2021,hidden,593,whib,2021-04-07,2,,incubating, +2021,hidden,593,whib,2021-04-15,0,,empty, +2021,hidden,593,whib,2021-04-21,,0,empty, +2021,hidden,593,whib,2021-04-28,,,, +2021,hidden,595,whib,2021-03-24,2,,incubating, +2021,hidden,595,whib,2021-03-31,3,,incubating, +2021,hidden,595,whib,2021-04-07,3,,incubating, +2021,hidden,595,whib,2021-04-15,,3,nestling, +2021,hidden,595,whib,2021-04-21,,0,empty, +2021,hidden,595,whib,2021-04-28,,,, +2021,hidden,597,whib,2021-03-24,2,,incubating, +2021,hidden,597,whib,2021-03-31,2,,incubating, +2021,hidden,597,whib,2021-04-07,2,,incubating, +2021,hidden,597,whib,2021-04-15,,2,nestling, +2021,hidden,597,whib,2021-04-21,,0,empty, +2021,hidden,597,whib,2021-04-28,,,, +2021,hidden,603,whib,2021-03-24,2,,incubating, +2021,hidden,603,whib,2021-03-31,1,,incubating, +2021,hidden,603,whib,2021-04-07,1,,incubating, +2021,hidden,603,whib,2021-04-15,,1,nestling, +2021,hidden,603,whib,2021-04-21,,0,empty, +2021,hidden,603,whib,2021-04-28,,,, +2021,hidden,601,whib,2021-03-24,2,,incubating, +2021,hidden,601,whib,2021-03-31,3,,incubating, +2021,hidden,601,whib,2021-04-07,2,,incubating, +2021,hidden,601,whib,2021-04-15,1,1,hatching, +2021,hidden,601,whib,2021-04-21,,0,empty, +2021,hidden,601,whib,2021-04-28,,,, +2021,hidden,605,whib,2021-03-24,2,,incubating, +2021,hidden,605,whib,2021-03-31,2,,incubating, +2021,hidden,605,whib,2021-04-07,1,,incubating, +2021,hidden,605,whib,2021-04-15,,1,nestling, +2021,hidden,605,whib,2021-04-21,,0,empty, +2021,hidden,605,whib,2021-04-28,,,, +2021,hidden,607,whib,2021-03-24,1,,incubating, +2021,hidden,607,whib,2021-03-31,2,,incubating, +2021,hidden,607,whib,2021-04-07,2,,incubating, +2021,hidden,607,whib,2021-04-15,1,1,wet_chick, +2021,hidden,607,whib,2021-04-21,,2,nestling, +2021,hidden,607,whib,2021-04-28,,0,empty, +2021,hidden,609,whib,2021-03-24,2,,incubating, +2021,hidden,609,whib,2021-03-31,2,,incubating, +2021,hidden,609,whib,2021-04-07,2,,incubating, +2021,hidden,609,whib,2021-04-15,,2,nestling, +2021,hidden,609,whib,2021-04-21,,2,nestling, +2021,hidden,609,whib,2021-04-28,,0,empty, +2021,hidden,611,whib,2021-03-24,3,,incubating, +2021,hidden,611,whib,2021-03-31,2,,incubating, +2021,hidden,611,whib,2021-04-07,0,,empty, +2021,hidden,611,whib,2021-04-15,,,, +2021,hidden,611,whib,2021-04-21,,0,empty, +2021,hidden,611,whib,2021-04-28,,,, +2021,hidden,613,whib,2021-03-24,3,,incubating, +2021,hidden,613,whib,2021-03-31,3,,incubating, +2021,hidden,613,whib,2021-04-07,3,,incubating, +2021,hidden,613,whib,2021-04-15,,2,nestling, +2021,hidden,613,whib,2021-04-21,,2,nestling, +2021,hidden,613,whib,2021-04-28,,1,nestling, +2021,hidden,615,whib,2021-03-24,2,,incubating, +2021,hidden,615,whib,2021-03-31,2,,incubating, +2021,hidden,615,whib,2021-04-07,2,,incubating, +2021,hidden,615,whib,2021-04-15,,2,nestling, +2021,hidden,615,whib,2021-04-21,,2,nestling, +2021,hidden,615,whib,2021-04-28,,2,nestling, +2021,hidden,617,whib,2021-03-24,1,,incubating, +2021,hidden,617,whib,2021-03-31,3,,incubating, +2021,hidden,617,whib,2021-04-07,3,,incubating, +2021,hidden,617,whib,2021-04-15,2,1,hatching, +2021,hidden,617,whib,2021-04-21,,3,nestling, +2021,hidden,617,whib,2021-04-28,,3,nestling, +2021,hidden,619,whib,2021-03-24,2,,incubating, +2021,hidden,619,whib,2021-03-31,2,,incubating, +2021,hidden,619,whib,2021-04-07,2,,incubating, +2021,hidden,619,whib,2021-04-15,,2,nestling, +2021,hidden,619,whib,2021-04-21,,3,nestling, +2021,hidden,619,whib,2021-04-28,,1,nestling, +2021,hidden,588,whib,2021-03-24,,,, +2021,hidden,588,whib,2021-03-31,3,,incubating, +2021,hidden,588,whib,2021-04-07,3,,incubating, +2021,hidden,588,whib,2021-04-15,3,,pipping, +2021,hidden,588,whib,2021-04-21,,3,nestling, +2021,hidden,588,whib,2021-04-28,,0,empty, +2021,hidden,586,whib,2021-03-24,1,,incubating, +2021,hidden,586,whib,2021-03-31,3,,incubating, +2021,hidden,586,whib,2021-04-07,3,,incubating, +2021,hidden,586,whib,2021-04-15,0,,empty, +2021,hidden,586,whib,2021-04-21,,0,empty, +2021,hidden,586,whib,2021-04-28,,,, +2021,hidden,584,whib,2021-03-24,1,,incubating, +2021,hidden,584,whib,2021-03-31,3,,incubating, +2021,hidden,584,whib,2021-04-07,3,,incubating, +2021,hidden,584,whib,2021-04-15,1,2,hatching, +2021,hidden,584,whib,2021-04-21,,2,nestling, +2021,hidden,584,whib,2021-04-28,,0,empty, +2021,hidden,590,whib,2021-03-24,1,,incubating, +2021,hidden,590,whib,2021-03-31,0,,empty, +2021,hidden,590,whib,2021-04-07,,,, +2021,hidden,590,whib,2021-04-15,,,, +2021,hidden,590,whib,2021-04-21,,,, +2021,hidden,590,whib,2021-04-28,,,, +2021,hidden,594,whib,2021-03-24,0,0,pre_flagged, +2021,hidden,594,whib,2021-03-31,2,,incubating, +2021,hidden,594,whib,2021-04-07,2,,incubating, +2021,hidden,594,whib,2021-04-15,2,,incubating, +2021,hidden,594,whib,2021-04-21,,1,nestling, +2021,hidden,594,whib,2021-04-28,,0,empty, +2021,hidden,592,whib,2021-03-24,1,,incubating, +2021,hidden,592,whib,2021-03-31,2,,incubating, +2021,hidden,592,whib,2021-04-07,3,,incubating, +2021,hidden,592,whib,2021-04-15,2,1,hatching, +2021,hidden,592,whib,2021-04-21,1,2,hatching, +2021,hidden,592,whib,2021-04-28,,1,nestling, +2021,hidden,596,whib,2021-03-24,1,,incubating, +2021,hidden,596,whib,2021-03-31,0,,empty, +2021,hidden,596,whib,2021-04-07,,,, +2021,hidden,596,whib,2021-04-15,,,, +2021,hidden,596,whib,2021-04-21,,,, +2021,hidden,596,whib,2021-04-28,,,, +2021,hidden,600,whib,2021-03-24,1,,incubating, +2021,hidden,600,whib,2021-03-31,3,,incubating, +2021,hidden,600,whib,2021-04-07,3,,incubating, +2021,hidden,600,whib,2021-04-15,1,2,hatching, +2021,hidden,600,whib,2021-04-21,,2,nestling, +2021,hidden,600,whib,2021-04-28,,1,nestling, +2021,hidden,602,whib,2021-03-24,1,,incubating, +2021,hidden,602,whib,2021-03-31,2,,incubating, +2021,hidden,602,whib,2021-04-07,2,,incubating, +2021,hidden,602,whib,2021-04-15,1,1,pipping, +2021,hidden,602,whib,2021-04-21,,2,nestling, +2021,hidden,602,whib,2021-04-28,,1,nestling, +2021,hidden,598,whib,2021-03-24,1,,incubating, +2021,hidden,598,whib,2021-03-31,2,,incubating, +2021,hidden,598,whib,2021-04-07,2,,incubating, +2021,hidden,598,whib,2021-04-15,2,,incubating, +2021,hidden,598,whib,2021-04-21,1,1,hatching, +2021,hidden,598,whib,2021-04-28,,1,nestling, +2021,hidden,621,whib,2021-03-24,3,,incubating, +2021,hidden,621,whib,2021-03-31,3,,incubating, +2021,hidden,621,whib,2021-04-07,3,,incubating, +2021,hidden,621,whib,2021-04-15,,3,nestling, +2021,hidden,621,whib,2021-04-21,,,, +2021,hidden,621,whib,2021-04-28,,,, +2021,hidden,623,whib,2021-03-24,3,,incubating, +2021,hidden,623,whib,2021-03-31,3,,incubating, +2021,hidden,623,whib,2021-04-07,2,1,hatching, +2021,hidden,623,whib,2021-04-15,,3,nestling, +2021,hidden,623,whib,2021-04-21,,3,nestling, +2021,hidden,623,whib,2021-04-28,,,, +2021,hidden,625,whib,2021-03-24,3,,incubating, +2021,hidden,625,whib,2021-03-31,3,,incubating, +2021,hidden,625,whib,2021-04-07,2,1,hatching, +2021,hidden,625,whib,2021-04-15,,2,nestling, +2021,hidden,625,whib,2021-04-21,,,, +2021,hidden,625,whib,2021-04-28,,,, +2021,hidden,627,whib,2021-03-24,2,,incubating, +2021,hidden,627,whib,2021-03-31,2,,incubating, +2021,hidden,627,whib,2021-04-07,2,,incubating, +2021,hidden,627,whib,2021-04-15,,2,nestling, +2021,hidden,627,whib,2021-04-21,,,, +2021,hidden,627,whib,2021-04-28,,,, +2021,hidden,629,whib,2021-03-24,3,,incubating, +2021,hidden,629,whib,2021-03-31,3,,incubating, +2021,hidden,629,whib,2021-04-07,3,,incubating, +2021,hidden,629,whib,2021-04-15,,3,nestling, +2021,hidden,629,whib,2021-04-21,,,, +2021,hidden,629,whib,2021-04-28,,,, +2021,hidden,631,whib,2021-03-24,3,,incubating, +2021,hidden,631,whib,2021-03-31,3,,incubating, +2021,hidden,631,whib,2021-04-07,2,,pipping, +2021,hidden,631,whib,2021-04-15,,3,nestling, +2021,hidden,631,whib,2021-04-21,,,, +2021,hidden,631,whib,2021-04-28,,,, +2021,hidden,618,whib,2021-03-24,2,,incubating, +2021,hidden,618,whib,2021-03-31,2,,incubating, +2021,hidden,618,whib,2021-04-07,2,,incubating, +2021,hidden,618,whib,2021-04-15,,2,nestling, +2021,hidden,618,whib,2021-04-21,,2,, +2021,hidden,618,whib,2021-04-28,,,, +2021,hidden,616,whib,2021-03-24,3,,incubating, +2021,hidden,616,whib,2021-03-31,3,,incubating, +2021,hidden,616,whib,2021-04-07,2,1,hatching, +2021,hidden,616,whib,2021-04-15,,3,nestling, +2021,hidden,616,whib,2021-04-21,,,, +2021,hidden,616,whib,2021-04-28,,,, +2021,hidden,635,whib,2021-03-24,3,,incubating, +2021,hidden,635,whib,2021-03-31,3,,incubating, +2021,hidden,635,whib,2021-04-07,2,1,hatching, +2021,hidden,635,whib,2021-04-15,,2,nestling, +2021,hidden,635,whib,2021-04-21,,,, +2021,hidden,635,whib,2021-04-28,,,, +2021,hidden,612,whib,2021-03-24,2,,incubating, +2021,hidden,612,whib,2021-03-31,2,,incubating, +2021,hidden,612,whib,2021-04-07,1,1,pipping, +2021,hidden,612,whib,2021-04-15,,2,nestling, +2021,hidden,612,whib,2021-04-21,,,, +2021,hidden,612,whib,2021-04-28,,,, +2021,hidden,608,whib,2021-03-24,3,,incubating, +2021,hidden,608,whib,2021-03-31,3,,incubating, +2021,hidden,608,whib,2021-04-07,2,1,pipping, +2021,hidden,608,whib,2021-04-15,,3,nestling, +2021,hidden,608,whib,2021-04-21,,,, +2021,hidden,608,whib,2021-04-28,,,, +2021,hidden,610,whib,2021-03-24,3,,incubating, +2021,hidden,610,whib,2021-03-31,3,,incubating, +2021,hidden,610,whib,2021-04-07,3,,incubating, +2021,hidden,610,whib,2021-04-15,,2,nestling, +2021,hidden,610,whib,2021-04-21,,,, +2021,hidden,610,whib,2021-04-28,,,, +2021,hidden,614,whib,2021-03-24,3,,incubating, +2021,hidden,614,whib,2021-03-31,3,,incubating, +2021,hidden,614,whib,2021-04-07,2,1,hatching, +2021,hidden,614,whib,2021-04-15,,3,nestling, +2021,hidden,614,whib,2021-04-21,,,, +2021,hidden,614,whib,2021-04-28,,,, +2021,hidden,637,whib,2021-03-24,3,,incubating, +2021,hidden,637,whib,2021-03-31,3,,incubating, +2021,hidden,637,whib,2021-04-07,3,,incubating, +2021,hidden,637,whib,2021-04-15,,3,nestling, +2021,hidden,637,whib,2021-04-21,,,, +2021,hidden,637,whib,2021-04-28,,,, +2021,hidden,606,whib,2021-03-24,3,,incubating, +2021,hidden,606,whib,2021-03-31,3,,incubating, +2021,hidden,606,whib,2021-04-07,3,,incubating, +2021,hidden,606,whib,2021-04-15,3,,incubating, +2021,hidden,606,whib,2021-04-21,,,, +2021,hidden,606,whib,2021-04-28,,,, +2021,hidden,604,whib,2021-03-24,3,,incubating, +2021,hidden,604,whib,2021-03-31,3,,incubating, +2021,hidden,604,whib,2021-04-07,3,,pipping, +2021,hidden,604,whib,2021-04-15,,3,nestling, +2021,hidden,604,whib,2021-04-21,,,, +2021,hidden,604,whib,2021-04-28,,,, +2021,hidden,620,whib,2021-03-24,3,,incubating, +2021,hidden,620,whib,2021-03-31,3,,incubating, +2021,hidden,620,whib,2021-04-07,2,1,hatching, +2021,hidden,620,whib,2021-04-15,,3,nestling, +2021,hidden,620,whib,2021-04-21,,,, +2021,hidden,620,whib,2021-04-28,,,, +2021,hidden,633,whib,2021-03-24,2,,incubating, +2021,hidden,633,whib,2021-03-31,2,,incubating, +2021,hidden,633,whib,2021-04-07,2,,incubating, +2021,hidden,633,whib,2021-04-15,,2,nestling, +2021,hidden,633,whib,2021-04-21,,,, +2021,hidden,633,whib,2021-04-28,,,, +2021,hidden,622,whib,2021-03-24,3,,incubating, +2021,hidden,622,whib,2021-03-31,3,,incubating, +2021,hidden,622,whib,2021-04-07,2,,pipping, +2021,hidden,622,whib,2021-04-15,,2,nestling, +2021,hidden,622,whib,2021-04-21,,0,empty, +2021,hidden,622,whib,2021-04-28,,,, +2021,hidden,624,whib,2021-03-24,3,,incubating, +2021,hidden,624,whib,2021-03-31,3,,incubating, +2021,hidden,624,whib,2021-04-07,3,,pipping, +2021,hidden,624,whib,2021-04-15,,3,nestling, +2021,hidden,624,whib,2021-04-21,,0,empty, +2021,hidden,624,whib,2021-04-28,,,, +2021,hidden,626,whib,2021-03-24,2,,incubating, +2021,hidden,626,whib,2021-03-31,2,,incubating, +2021,hidden,626,whib,2021-04-07,1,1,hatching, +2021,hidden,626,whib,2021-04-15,,1,nestling, +2021,hidden,626,whib,2021-04-21,,1,nestling, +2021,hidden,626,whib,2021-04-28,,,, +2021,hidden,639,whib,2021-03-24,3,,incubating, +2021,hidden,639,whib,2021-03-31,3,,incubating, +2021,hidden,639,whib,2021-04-07,3,,incubating, +2021,hidden,639,whib,2021-04-15,,3,nestling, +2021,hidden,639,whib,2021-04-21,,2,nestling, +2021,hidden,639,whib,2021-04-28,,,, +2021,hidden,641,whib,2021-03-24,3,,incubating, +2021,hidden,641,whib,2021-03-31,3,,incubating, +2021,hidden,641,whib,2021-04-07,3,,incubating, +2021,hidden,641,whib,2021-04-15,,2,nestling, +2021,hidden,641,whib,2021-04-21,,2,nestling, +2021,hidden,641,whib,2021-04-28,,,, +2021,hidden,643,whib,2021-03-24,3,,incubating, +2021,hidden,643,whib,2021-03-31,3,,incubating, +2021,hidden,643,whib,2021-04-07,3,,incubating, +2021,hidden,643,whib,2021-04-15,,3,nestling, +2021,hidden,643,whib,2021-04-21,,2,nestling, +2021,hidden,643,whib,2021-04-28,,,, +2021,hidden,645,whib,2021-03-24,3,,incubating, +2021,hidden,645,whib,2021-03-31,3,,incubating, +2021,hidden,645,whib,2021-04-07,3,,pipping, +2021,hidden,645,whib,2021-04-15,,3,nestling, +2021,hidden,645,whib,2021-04-21,,2,nestling, +2021,hidden,645,whib,2021-04-28,,,, +2021,hidden,647,whib,2021-03-24,3,,incubating, +2021,hidden,647,whib,2021-03-31,3,,incubating, +2021,hidden,647,whib,2021-04-07,3,,pipping, +2021,hidden,647,whib,2021-04-15,,3,nestling, +2021,hidden,647,whib,2021-04-21,,2,nestling, +2021,hidden,647,whib,2021-04-28,,,, +2021,hidden,649,whib,2021-03-24,3,,incubating, +2021,hidden,649,whib,2021-03-31,3,,incubating, +2021,hidden,649,whib,2021-04-07,2,1,hatching, +2021,hidden,649,whib,2021-04-15,,3,nestling, +2021,hidden,649,whib,2021-04-21,,2,nestling, +2021,hidden,649,whib,2021-04-28,,,, +2021,hidden,651,whib,2021-03-24,2,,incubating, +2021,hidden,651,whib,2021-03-31,3,,incubating, +2021,hidden,651,whib,2021-04-07,3,,incubating, +2021,hidden,651,whib,2021-04-15,1,2,pipping, +2021,hidden,651,whib,2021-04-21,,2,nestling, +2021,hidden,651,whib,2021-04-28,,,, +2021,hidden,653,whib,2021-03-24,1,,incubating, +2021,hidden,653,whib,2021-03-31,3,,incubating, +2021,hidden,653,whib,2021-04-07,3,,incubating, +2021,hidden,653,whib,2021-04-15,2,1,pipping, +2021,hidden,653,whib,2021-04-21,,2,nestling, +2021,hidden,653,whib,2021-04-28,,,, +2021,hidden,655,whib,2021-03-24,3,,incubating, +2021,hidden,655,whib,2021-03-31,3,,incubating, +2021,hidden,655,whib,2021-04-07,3,,incubating, +2021,hidden,655,whib,2021-04-15,,3,nestling, +2021,hidden,655,whib,2021-04-21,,2,nestling, +2021,hidden,655,whib,2021-04-28,,,, +2021,hidden,657,whib,2021-03-24,1,,incubating, +2021,hidden,657,whib,2021-03-31,1,,incubating, +2021,hidden,657,whib,2021-04-07,1,,incubating, +2021,hidden,657,whib,2021-04-15,,1,nestling, +2021,hidden,657,whib,2021-04-21,,1,nestling, +2021,hidden,657,whib,2021-04-28,,,, +2021,hidden,659,whib,2021-03-24,3,,incubating, +2021,hidden,659,whib,2021-03-31,3,,incubating, +2021,hidden,659,whib,2021-04-07,3,,incubating, +2021,hidden,659,whib,2021-04-15,,3,nestling, +2021,hidden,659,whib,2021-04-21,,1,nestling, +2021,hidden,659,whib,2021-04-28,,,, +2021,hidden,661,whib,2021-03-24,3,,incubating, +2021,hidden,661,whib,2021-03-31,3,,incubating, +2021,hidden,661,whib,2021-04-07,3,,incubating, +2021,hidden,661,whib,2021-04-15,,3,nestling, +2021,hidden,661,whib,2021-04-21,,0,empty, +2021,hidden,661,whib,2021-04-28,,,, +2021,hidden,663,whib,2021-03-24,,,, +2021,hidden,663,whib,2021-03-31,3,,incubating, +2021,hidden,663,whib,2021-04-07,2,1,hatching, +2021,hidden,663,whib,2021-04-15,,3,nestling, +2021,hidden,663,whib,2021-04-21,,3,nestling, +2021,hidden,663,whib,2021-04-28,,,, +2021,hidden,665,whib,2021-03-24,,,, +2021,hidden,665,whib,2021-03-31,2,,incubating, +2021,hidden,665,whib,2021-04-07,2,,incubating, +2021,hidden,665,whib,2021-04-15,1,1,hatching, +2021,hidden,665,whib,2021-04-21,,2,nestling, +2021,hidden,665,whib,2021-04-28,,1,nestling, +2021,hidden,679,whib,2021-03-24,,,, +2021,hidden,679,whib,2021-03-31,3,,incubating, +2021,hidden,679,whib,2021-04-07,3,,incubating, +2021,hidden,679,whib,2021-04-15,,3,nestling, +2021,hidden,679,whib,2021-04-21,,3,nestling, +2021,hidden,679,whib,2021-04-28,,1,nestling, +2021,hidden,681,whib,2021-03-24,,,, +2021,hidden,681,whib,2021-03-31,2,,incubating, +2021,hidden,681,whib,2021-04-07,2,,incubating, +2021,hidden,681,whib,2021-04-15,,2,nestling, +2021,hidden,681,whib,2021-04-21,,1,nestling, +2021,hidden,681,whib,2021-04-28,,,, +2021,hidden,683,whib,2021-03-24,,,, +2021,hidden,683,whib,2021-03-31,3,,incubating, +2021,hidden,683,whib,2021-04-07,3,,incubating, +2021,hidden,683,whib,2021-04-15,,3,nestling, +2021,hidden,683,whib,2021-04-21,,2,nestling, +2021,hidden,683,whib,2021-04-28,,,, +2021,hidden,685,whib,2021-03-24,,,, +2021,hidden,685,whib,2021-03-31,3,,incubating, +2021,hidden,685,whib,2021-04-07,3,,incubating, +2021,hidden,685,whib,2021-04-15,1,2,hatching, +2021,hidden,685,whib,2021-04-21,,2,nestling, +2021,hidden,685,whib,2021-04-28,,,, +2021,hidden,731,whib,2021-03-24,,,, +2021,hidden,731,whib,2021-03-31,3,,incubating, +2021,hidden,731,whib,2021-04-07,2,1,hatching, +2021,hidden,731,whib,2021-04-15,,2,nestling, +2021,hidden,731,whib,2021-04-21,,,missed, +2021,hidden,731,whib,2021-04-28,,,, +2021,hidden,687,whib,2021-03-24,,,, +2021,hidden,687,whib,2021-03-31,2,,incubating, +2021,hidden,687,whib,2021-04-07,1,1,wet_chick, +2021,hidden,687,whib,2021-04-15,1,1,hatching, +2021,hidden,687,whib,2021-04-21,,1,nestling, +2021,hidden,687,whib,2021-04-28,,,, +2021,hidden,689,whib,2021-03-24,,,, +2021,hidden,689,whib,2021-03-31,3,,incubating, +2021,hidden,689,whib,2021-04-07,3,,incubating, +2021,hidden,689,whib,2021-04-15,0,,empty, +2021,hidden,689,whib,2021-04-21,,,, +2021,hidden,689,whib,2021-04-28,,,, +2021,hidden,691,whib,2021-03-24,,,, +2021,hidden,691,whib,2021-03-31,3,,incubating, +2021,hidden,691,whib,2021-04-07,3,,incubating, +2021,hidden,691,whib,2021-04-15,,3,nestling, +2021,hidden,691,whib,2021-04-21,,2,nestling, +2021,hidden,691,whib,2021-04-28,,3,nestling, +2021,hidden,693,whib,2021-03-24,,,, +2021,hidden,693,whib,2021-03-31,3,,incubating, +2021,hidden,693,whib,2021-04-07,3,,incubating, +2021,hidden,693,whib,2021-04-15,,3,nestling, +2021,hidden,693,whib,2021-04-21,,2,nestling, +2021,hidden,693,whib,2021-04-28,,,, +2021,hidden,695,whib,2021-03-24,,,, +2021,hidden,695,whib,2021-03-31,2,,incubating, +2021,hidden,695,whib,2021-04-07,1,1,hatching, +2021,hidden,695,whib,2021-04-15,,2,nestling, +2021,hidden,695,whib,2021-04-21,,1,nestling, +2021,hidden,695,whib,2021-04-28,,,, +2021,hidden,737,whib,2021-03-24,,,, +2021,hidden,737,whib,2021-03-31,,,, +2021,hidden,737,whib,2021-04-07,3,,incubating, +2021,hidden,737,whib,2021-04-15,1,2,pipping, +2021,hidden,737,whib,2021-04-21,,2,nestling, +2021,hidden,737,whib,2021-04-28,,1,nestling, +2021,hidden,671,whib,2021-03-24,,,, +2021,hidden,671,whib,2021-03-31,3,,incubating, +2021,hidden,671,whib,2021-04-07,4,,pipping, +2021,hidden,671,whib,2021-04-15,1,2,hatching, +2021,hidden,671,whib,2021-04-21,,3,nestling, +2021,hidden,671,whib,2021-04-28,,,, +2021,hidden,673,whib,2021-03-24,,,, +2021,hidden,673,whib,2021-03-31,2,,incubating, +2021,hidden,673,whib,2021-04-07,2,,incubating, +2021,hidden,673,whib,2021-04-15,,2,nestling, +2021,hidden,673,whib,2021-04-21,,2,nestling, +2021,hidden,673,whib,2021-04-28,,,, +2021,hidden,669,whib,2021-03-24,,,, +2021,hidden,669,whib,2021-03-31,3,,incubating, +2021,hidden,669,whib,2021-04-07,2,1,wet_chick, +2021,hidden,669,whib,2021-04-15,,3,nestling, +2021,hidden,669,whib,2021-04-21,,3,nestling, +2021,hidden,669,whib,2021-04-28,,,, +2021,hidden,667,whib,2021-03-24,,,, +2021,hidden,667,whib,2021-03-31,2,,incubating, +2021,hidden,667,whib,2021-04-07,2,,incubating, +2021,hidden,667,whib,2021-04-15,1,1,hatching, +2021,hidden,667,whib,2021-04-21,,1,nestling, +2021,hidden,667,whib,2021-04-28,,,, +2021,hidden,677,whib,2021-03-24,,,, +2021,hidden,677,whib,2021-03-31,3,,incubating, +2021,hidden,677,whib,2021-04-07,1,2,pipping, +2021,hidden,677,whib,2021-04-15,,3,nestling, +2021,hidden,677,whib,2021-04-21,,3,nestling, +2021,hidden,677,whib,2021-04-28,,,, +2021,hidden,675,whib,2021-03-24,,,, +2021,hidden,675,whib,2021-03-31,3,,incubating, +2021,hidden,675,whib,2021-04-07,3,,incubating, +2021,hidden,675,whib,2021-04-15,0,,empty, +2021,hidden,675,whib,2021-04-21,,,, +2021,hidden,675,whib,2021-04-28,,,, +2021,hidden,701,whib,2021-03-24,,,, +2021,hidden,701,whib,2021-03-31,1,,incubating, +2021,hidden,701,whib,2021-04-07,1,,incubating, +2021,hidden,701,whib,2021-04-15,,1,nestling, +2021,hidden,701,whib,2021-04-21,,1,nestling, +2021,hidden,701,whib,2021-04-28,,,, +2021,hidden,697,whib,2021-03-24,,,, +2021,hidden,697,whib,2021-03-31,3,,incubating, +2021,hidden,697,whib,2021-04-07,2,1,wet_chick, +2021,hidden,697,whib,2021-04-15,,3,nestling, +2021,hidden,697,whib,2021-04-21,,2,nestling, +2021,hidden,697,whib,2021-04-28,,,, +2021,hidden,699,whib,2021-03-24,,,, +2021,hidden,699,whib,2021-03-31,3,,incubating, +2021,hidden,699,whib,2021-04-07,3,,incubating, +2021,hidden,699,whib,2021-04-15,1,2,hatching, +2021,hidden,699,whib,2021-04-21,,0,empty, +2021,hidden,699,whib,2021-04-28,,,, +2021,hidden,719,whib,2021-03-24,,,, +2021,hidden,719,whib,2021-03-31,3,,incubating, +2021,hidden,719,whib,2021-04-07,3,,incubating, +2021,hidden,719,whib,2021-04-15,2,1,hatching, +2021,hidden,719,whib,2021-04-21,,3,nestling, +2021,hidden,719,whib,2021-04-28,,,, +2021,hidden,703,whib,2021-03-24,,,, +2021,hidden,703,whib,2021-03-31,2,,incubating, +2021,hidden,703,whib,2021-04-07,2,,incubating, +2021,hidden,703,whib,2021-04-15,,2,nestling, +2021,hidden,703,whib,2021-04-21,,2,nestling, +2021,hidden,703,whib,2021-04-28,,,, +2021,hidden,715,whib,2021-03-24,,,, +2021,hidden,715,whib,2021-03-31,1,,incubating, +2021,hidden,715,whib,2021-04-07,1,,incubating, +2021,hidden,715,whib,2021-04-15,,1,nestling, +2021,hidden,715,whib,2021-04-21,,1,nestling, +2021,hidden,715,whib,2021-04-28,,,, +2021,hidden,717,whib,2021-03-24,,,, +2021,hidden,717,whib,2021-03-31,3,,incubating, +2021,hidden,717,whib,2021-04-07,3,,incubating, +2021,hidden,717,whib,2021-04-15,1,2,hatching, +2021,hidden,717,whib,2021-04-21,,2,nestling, +2021,hidden,717,whib,2021-04-28,,,, +2021,hidden,713,whib,2021-03-24,,,, +2021,hidden,713,whib,2021-03-31,2,,incubating, +2021,hidden,713,whib,2021-04-07,2,,incubating, +2021,hidden,713,whib,2021-04-15,1,1,hatching, +2021,hidden,713,whib,2021-04-21,,2,nestling, +2021,hidden,713,whib,2021-04-28,,,, +2021,hidden,725,whib,2021-03-24,,,, +2021,hidden,725,whib,2021-03-31,3,,incubating, +2021,hidden,725,whib,2021-04-07,3,,incubating, +2021,hidden,725,whib,2021-04-15,,3,nestling, +2021,hidden,725,whib,2021-04-21,,2,nestling, +2021,hidden,725,whib,2021-04-28,,,, +2021,hidden,723,whib,2021-03-24,,,, +2021,hidden,723,whib,2021-03-31,3,,incubating, +2021,hidden,723,whib,2021-04-07,3,,incubating, +2021,hidden,723,whib,2021-04-15,,2,nestling, +2021,hidden,723,whib,2021-04-21,,2,nestling, +2021,hidden,723,whib,2021-04-28,,,, +2021,hidden,727,whib,2021-03-24,,,, +2021,hidden,727,whib,2021-03-31,3,,incubating, +2021,hidden,727,whib,2021-04-07,3,,incubating, +2021,hidden,727,whib,2021-04-15,1,2,hatching, +2021,hidden,727,whib,2021-04-21,,3,nestling, +2021,hidden,727,whib,2021-04-28,,,, +2021,hidden,721,whib,2021-03-24,,,, +2021,hidden,721,whib,2021-03-31,3,,incubating, +2021,hidden,721,whib,2021-04-07,3,,incubating, +2021,hidden,721,whib,2021-04-15,,3,nestling, +2021,hidden,721,whib,2021-04-21,,2,nestling, +2021,hidden,721,whib,2021-04-28,,,, +2021,hidden,705,whib,2021-03-24,,,, +2021,hidden,705,whib,2021-03-31,3,,incubating, +2021,hidden,705,whib,2021-04-07,3,,incubating, +2021,hidden,705,whib,2021-04-15,,3,nestling, +2021,hidden,705,whib,2021-04-21,,2,nestling, +2021,hidden,705,whib,2021-04-28,,,, +2021,hidden,707,whib,2021-03-24,,,, +2021,hidden,707,whib,2021-03-31,2,,incubating, +2021,hidden,707,whib,2021-04-07,1,1,hatching, +2021,hidden,707,whib,2021-04-15,,2,nestling, +2021,hidden,707,whib,2021-04-21,,2,nestling, +2021,hidden,707,whib,2021-04-28,,,, +2021,hidden,729,whib,2021-03-24,,,, +2021,hidden,729,whib,2021-03-31,3,,incubating, +2021,hidden,729,whib,2021-04-07,3,,incubating, +2021,hidden,729,whib,2021-04-15,,3,nestling, +2021,hidden,729,whib,2021-04-21,,2,nestling, +2021,hidden,729,whib,2021-04-28,,,, +2021,hidden,709,whib,2021-03-24,,,, +2021,hidden,709,whib,2021-03-31,2,,incubating, +2021,hidden,709,whib,2021-04-07,1,1,hatching, +2021,hidden,709,whib,2021-04-15,,2,nestling, +2021,hidden,709,whib,2021-04-21,,2,nestling, +2021,hidden,709,whib,2021-04-28,,,, +2021,hidden,711,whib,2021-03-24,,,, +2021,hidden,711,whib,2021-03-31,2,,incubating, +2021,hidden,711,whib,2021-04-07,2,,incubating, +2021,hidden,711,whib,2021-04-15,1,1,hatching, +2021,hidden,711,whib,2021-04-21,1,,incubating, +2021,hidden,711,whib,2021-04-28,,,, +2021,hidden,739,whib,2021-03-24,,,, +2021,hidden,739,whib,2021-03-31,,,, +2021,hidden,739,whib,2021-04-07,3,,incubating, +2021,hidden,739,whib,2021-04-15,1,2,hatching, +2021,hidden,739,whib,2021-04-21,,2,nestling, +2021,hidden,739,whib,2021-04-28,,,, +2021,hidden,741,whib,2021-03-24,,,, +2021,hidden,741,whib,2021-03-31,,,, +2021,hidden,741,whib,2021-04-07,2,,incubating, +2021,hidden,741,whib,2021-04-15,1,1,hatching, +2021,hidden,741,whib,2021-04-21,1,1,hatching, +2021,hidden,741,whib,2021-04-28,,,, +2021,hidden,743,whib,2021-03-24,,,, +2021,hidden,743,whib,2021-03-31,,,, +2021,hidden,743,whib,2021-04-07,3,,incubating, +2021,hidden,743,whib,2021-04-15,1,2,wet_chick, +2021,hidden,743,whib,2021-04-21,,3,nestling, +2021,hidden,743,whib,2021-04-28,,,, +2021,joule,94,greg,2021-02-24,1,,incubating,"3/24 pulled" +2021,joule,94,greg,2021-03-03,0,,empty,"3/24 pulled" +2021,joule,94,greg,2021-03-10,,,,"3/24 pulled" +2021,joule,94,greg,2021-03-17,,,,"3/24 pulled" +2021,joule,94,greg,2021-03-24,,,,"3/24 pulled" +2021,joule,94,greg,2021-03-31,,,,"3/24 pulled" +2021,joule,94,greg,2021-04-07,,,,"3/24 pulled" +2021,joule,94,greg,2021-04-15,,,,"3/24 pulled" +2021,joule,94,greg,2021-04-21,,,,"3/24 pulled" +2021,joule,94,greg,2021-04-28,,,,"3/24 pulled" +2021,joule,217,greg,2021-02-24,2,,incubating,"3/3 collapsed and pulled" +2021,joule,217,greg,2021-03-03,0,,empty,"3/3 collapsed and pulled" +2021,joule,217,greg,2021-03-10,,,,"3/3 collapsed and pulled" +2021,joule,217,greg,2021-03-17,,,,"3/3 collapsed and pulled" +2021,joule,217,greg,2021-03-24,,,,"3/3 collapsed and pulled" +2021,joule,217,greg,2021-03-31,,,,"3/3 collapsed and pulled" +2021,joule,217,greg,2021-04-07,,,,"3/3 collapsed and pulled" +2021,joule,217,greg,2021-04-15,,,,"3/3 collapsed and pulled" +2021,joule,217,greg,2021-04-21,,,,"3/3 collapsed and pulled" +2021,joule,217,greg,2021-04-28,,,,"3/3 collapsed and pulled" +2021,joule,71,greg,2021-02-24,,,,"3/3 2 6ft rat snake skins found in colony" +2021,joule,71,greg,2021-03-03,3,,incubating,"3/3 2 6ft rat snake skins found in colony" +2021,joule,71,greg,2021-03-10,3,,incubating,"3/3 2 6ft rat snake skins found in colony" +2021,joule,71,greg,2021-03-17,3,,incubating,"3/3 2 6ft rat snake skins found in colony" +2021,joule,71,greg,2021-03-24,,3,nestling,"3/3 2 6ft rat snake skins found in colony" +2021,joule,71,greg,2021-03-31,,3,nestling,"3/3 2 6ft rat snake skins found in colony" +2021,joule,71,greg,2021-04-07,,3,nestling,"3/3 2 6ft rat snake skins found in colony" +2021,joule,71,greg,2021-04-15,,3,nestling,"3/3 2 6ft rat snake skins found in colony" +2021,joule,71,greg,2021-04-21,,3,nestling,"3/3 2 6ft rat snake skins found in colony" +2021,joule,71,greg,2021-04-28,0,0,empty,"3/3 2 6ft rat snake skins found in colony" +2021,joule,170,greg,2021-02-24,,,, +2021,joule,170,greg,2021-03-03,2,,incubating, +2021,joule,170,greg,2021-03-10,2,,incubating, +2021,joule,170,greg,2021-03-17,0,,empty, +2021,joule,170,greg,2021-03-24,,,, +2021,joule,170,greg,2021-03-31,,,, +2021,joule,170,greg,2021-04-07,,,, +2021,joule,170,greg,2021-04-15,,,, +2021,joule,170,greg,2021-04-21,,,, +2021,joule,170,greg,2021-04-28,,,, +2021,joule,75,greg,2021-02-24,,,,"4/21 mercury" +2021,joule,75,greg,2021-03-03,2,,incubating,"4/21 mercury" +2021,joule,75,greg,2021-03-10,3,,incubating,"4/21 mercury" +2021,joule,75,greg,2021-03-17,3,,incubating,"4/21 mercury" +2021,joule,75,greg,2021-03-24,3,,incubating,"4/21 mercury" +2021,joule,75,greg,2021-03-31,,3,wet_chick,"4/21 mercury" +2021,joule,75,greg,2021-04-07,,3,nestling,"4/21 mercury" +2021,joule,75,greg,2021-04-15,,3,nestling,"4/21 mercury" +2021,joule,75,greg,2021-04-21,,3,nestling,"4/21 mercury" +2021,joule,75,greg,2021-04-28,0,0,empty,"4/21 mercury" +2021,joule,96,greg,2021-02-24,1,,incubating,"4/21 1 dead chick on ground, drone flagged" +2021,joule,96,greg,2021-03-03,3,,incubating,"4/21 1 dead chick on ground, drone flagged" +2021,joule,96,greg,2021-03-10,3,,incubating,"4/21 1 dead chick on ground, drone flagged" +2021,joule,96,greg,2021-03-17,3,,incubating,"4/21 1 dead chick on ground, drone flagged" +2021,joule,96,greg,2021-03-24,2,1,hatching,"4/21 1 dead chick on ground, drone flagged" +2021,joule,96,greg,2021-03-31,,3,nestling,"4/21 1 dead chick on ground, drone flagged" +2021,joule,96,greg,2021-04-07,,3,nestling,"4/21 1 dead chick on ground, drone flagged" +2021,joule,96,greg,2021-04-15,,3,nestling,"4/21 1 dead chick on ground, drone flagged" +2021,joule,96,greg,2021-04-21,,2,nestling,"4/21 1 dead chick on ground, drone flagged" +2021,joule,96,greg,2021-04-28,0,0,empty,"4/21 1 dead chick on ground, drone flagged" +2021,joule,159,greg,2021-02-24,,,, +2021,joule,159,greg,2021-03-03,2,,incubating, +2021,joule,159,greg,2021-03-10,2,,incubating, +2021,joule,159,greg,2021-03-17,2,,incubating, +2021,joule,159,greg,2021-03-24,2,,incubating, +2021,joule,159,greg,2021-03-31,1,1,hatching, +2021,joule,159,greg,2021-04-07,,1,nestling, +2021,joule,159,greg,2021-04-15,,1,nestling, +2021,joule,159,greg,2021-04-21,,1,nestling, +2021,joule,159,greg,2021-04-28,0,0,empty, +2021,joule,130,greg,2021-02-24,1,,incubating, +2021,joule,130,greg,2021-03-03,2,,incubating, +2021,joule,130,greg,2021-03-10,2,,incubating, +2021,joule,130,greg,2021-03-17,2,,incubating, +2021,joule,130,greg,2021-03-24,1,1,hatching, +2021,joule,130,greg,2021-03-31,,2,nestling, +2021,joule,130,greg,2021-04-07,,2,nestling, +2021,joule,130,greg,2021-04-15,,2,nestling, +2021,joule,130,greg,2021-04-21,,2,nestling, +2021,joule,130,greg,2021-04-28,0,0,empty, +2021,joule,98,greg,2021-02-24,2,,incubating,"3/24 collapsed and pulled" +2021,joule,98,greg,2021-03-03,0,,empty,"3/24 collapsed and pulled" +2021,joule,98,greg,2021-03-10,,,,"3/24 collapsed and pulled" +2021,joule,98,greg,2021-03-17,,,,"3/24 collapsed and pulled" +2021,joule,98,greg,2021-03-24,,,,"3/24 collapsed and pulled" +2021,joule,98,greg,2021-03-31,,,,"3/24 collapsed and pulled" +2021,joule,98,greg,2021-04-07,,,,"3/24 collapsed and pulled" +2021,joule,98,greg,2021-04-15,,,,"3/24 collapsed and pulled" +2021,joule,98,greg,2021-04-21,,,,"3/24 collapsed and pulled" +2021,joule,98,greg,2021-04-28,,,,"3/24 collapsed and pulled" +2021,joule,219,greg,2021-02-24,1,,incubating,"4/15 mercury" +2021,joule,219,greg,2021-03-03,2,,incubating,"4/15 mercury" +2021,joule,219,greg,2021-03-10,2,,incubating,"4/15 mercury" +2021,joule,219,greg,2021-03-17,2,,incubating,"4/15 mercury" +2021,joule,219,greg,2021-03-24,,2,wet_chick,"4/15 mercury" +2021,joule,219,greg,2021-03-31,,2,nestling,"4/15 mercury" +2021,joule,219,greg,2021-04-07,,2,nestling,"4/15 mercury" +2021,joule,219,greg,2021-04-15,,2,nestling,"4/15 mercury" +2021,joule,219,greg,2021-04-21,,2,nestling,"4/15 mercury" +2021,joule,219,greg,2021-04-28,0,0,empty,"4/15 mercury" +2021,joule,132,greg,2021-02-24,0,0,pre_flagged,"3/17 partially collapsed, 3/24 pulled" +2021,joule,132,greg,2021-03-03,2,,incubating,"3/17 partially collapsed, 3/24 pulled" +2021,joule,132,greg,2021-03-10,0,,empty,"3/17 partially collapsed, 3/24 pulled" +2021,joule,132,greg,2021-03-17,,,,"3/17 partially collapsed, 3/24 pulled" +2021,joule,132,greg,2021-03-24,,,,"3/17 partially collapsed, 3/24 pulled" +2021,joule,132,greg,2021-03-31,,,,"3/17 partially collapsed, 3/24 pulled" +2021,joule,132,greg,2021-04-07,,,,"3/17 partially collapsed, 3/24 pulled" +2021,joule,132,greg,2021-04-15,,,,"3/17 partially collapsed, 3/24 pulled" +2021,joule,132,greg,2021-04-21,,,,"3/17 partially collapsed, 3/24 pulled" +2021,joule,132,greg,2021-04-28,,,,"3/17 partially collapsed, 3/24 pulled" +2021,joule,221,greg,2021-02-24,3,,incubating,"3/10 nest gone" +2021,joule,221,greg,2021-03-03,0,,empty,"3/10 nest gone" +2021,joule,221,greg,2021-03-10,,,,"3/10 nest gone" +2021,joule,221,greg,2021-03-17,,,,"3/10 nest gone" +2021,joule,221,greg,2021-03-24,,,,"3/10 nest gone" +2021,joule,221,greg,2021-03-31,,,,"3/10 nest gone" +2021,joule,221,greg,2021-04-07,,,,"3/10 nest gone" +2021,joule,221,greg,2021-04-15,,,,"3/10 nest gone" +2021,joule,221,greg,2021-04-21,,,,"3/10 nest gone" +2021,joule,221,greg,2021-04-28,,,,"3/10 nest gone" +2021,joule,100,greg,2021-02-24,2,,incubating,"4/7 gone" +2021,joule,100,greg,2021-03-03,3,,incubating,"4/7 gone" +2021,joule,100,greg,2021-03-10,3,,incubating,"4/7 gone" +2021,joule,100,greg,2021-03-17,0,,empty,"4/7 gone" +2021,joule,100,greg,2021-03-24,,,,"4/7 gone" +2021,joule,100,greg,2021-03-31,,,,"4/7 gone" +2021,joule,100,greg,2021-04-07,,,,"4/7 gone" +2021,joule,100,greg,2021-04-15,,,,"4/7 gone" +2021,joule,100,greg,2021-04-21,,,,"4/7 gone" +2021,joule,100,greg,2021-04-28,,,,"4/7 gone" +2021,joule,223,greg,2021-02-24,2,,incubating,"4/15 mercury" +2021,joule,223,greg,2021-03-03,3,,incubating,"4/15 mercury" +2021,joule,223,greg,2021-03-10,3,,incubating,"4/15 mercury" +2021,joule,223,greg,2021-03-17,2,,incubating,"4/15 mercury" +2021,joule,223,greg,2021-03-24,,2,nestling,"4/15 mercury" +2021,joule,223,greg,2021-03-31,,2,nestling,"4/15 mercury" +2021,joule,223,greg,2021-04-07,,2,nestling,"4/15 mercury" +2021,joule,223,greg,2021-04-15,,2,nestling,"4/15 mercury" +2021,joule,223,greg,2021-04-21,,2,nestling,"4/15 mercury" +2021,joule,223,greg,2021-04-28,0,0,empty,"4/15 mercury" +2021,joule,102,greg,2021-02-24,2,,incubating,"3/24 egg pipping in addition to wet chick4/21 drone flagged" +2021,joule,102,greg,2021-03-03,2,,incubating,"3/24 egg pipping in addition to wet chick4/21 drone flagged" +2021,joule,102,greg,2021-03-10,2,,incubating,"3/24 egg pipping in addition to wet chick4/21 drone flagged" +2021,joule,102,greg,2021-03-17,2,,incubating,"3/24 egg pipping in addition to wet chick4/21 drone flagged" +2021,joule,102,greg,2021-03-24,1,1,wet_chick,"3/24 egg pipping in addition to wet chick4/21 drone flagged" +2021,joule,102,greg,2021-03-31,,2,nestling,"3/24 egg pipping in addition to wet chick4/21 drone flagged" +2021,joule,102,greg,2021-04-07,,2,nestling,"3/24 egg pipping in addition to wet chick4/21 drone flagged" +2021,joule,102,greg,2021-04-15,,2,nestling,"3/24 egg pipping in addition to wet chick4/21 drone flagged" +2021,joule,102,greg,2021-04-21,,2,nestling,"3/24 egg pipping in addition to wet chick4/21 drone flagged" +2021,joule,102,greg,2021-04-28,0,0,empty,"3/24 egg pipping in addition to wet chick4/21 drone flagged" +2021,joule,104,greg,2021-02-24,3,,incubating,"4/7 most of nest material and 1 dead chick on the ground, 2 chicks in branches above,4/21 drone flagged" +2021,joule,104,greg,2021-03-03,3,,incubating,"4/7 most of nest material and 1 dead chick on the ground, 2 chicks in branches above,4/21 drone flagged" +2021,joule,104,greg,2021-03-10,3,,incubating,"4/7 most of nest material and 1 dead chick on the ground, 2 chicks in branches above,4/21 drone flagged" +2021,joule,104,greg,2021-03-17,3,,incubating,"4/7 most of nest material and 1 dead chick on the ground, 2 chicks in branches above,4/21 drone flagged" +2021,joule,104,greg,2021-03-24,,3,nestling,"4/7 most of nest material and 1 dead chick on the ground, 2 chicks in branches above,4/21 drone flagged" +2021,joule,104,greg,2021-03-31,,3,nestling,"4/7 most of nest material and 1 dead chick on the ground, 2 chicks in branches above,4/21 drone flagged" +2021,joule,104,greg,2021-04-07,,2,nestling,"4/7 most of nest material and 1 dead chick on the ground, 2 chicks in branches above,4/21 drone flagged" +2021,joule,104,greg,2021-04-15,,2,nestling,"4/7 most of nest material and 1 dead chick on the ground, 2 chicks in branches above,4/21 drone flagged" +2021,joule,104,greg,2021-04-21,,2,nestling,"4/7 most of nest material and 1 dead chick on the ground, 2 chicks in branches above,4/21 drone flagged" +2021,joule,104,greg,2021-04-28,0,0,empty,"4/7 most of nest material and 1 dead chick on the ground, 2 chicks in branches above,4/21 drone flagged" +2021,joule,225,greg,2021-02-24,3,,incubating,"4/15 mercury" +2021,joule,225,greg,2021-03-03,,,missed,"4/15 mercury" +2021,joule,225,greg,2021-03-10,3,,incubating,"4/15 mercury" +2021,joule,225,greg,2021-03-17,3,,incubating,"4/15 mercury" +2021,joule,225,greg,2021-03-24,1,2,hatching,"4/15 mercury" +2021,joule,225,greg,2021-03-31,1,2,hatching,"4/15 mercury" +2021,joule,225,greg,2021-04-07,1,2,hatching,"4/15 mercury" +2021,joule,225,greg,2021-04-15,,2,nestling,"4/15 mercury" +2021,joule,225,greg,2021-04-21,,2,nestling,"4/15 mercury" +2021,joule,225,greg,2021-04-28,0,0,empty,"4/15 mercury" +2021,joule,138,greg,2021-02-24,1,,incubating,"3/24 pulled" +2021,joule,138,greg,2021-03-03,0,,empty,"3/24 pulled" +2021,joule,138,greg,2021-03-10,,,,"3/24 pulled" +2021,joule,138,greg,2021-03-17,,,,"3/24 pulled" +2021,joule,138,greg,2021-03-24,,,,"3/24 pulled" +2021,joule,138,greg,2021-03-31,,,,"3/24 pulled" +2021,joule,138,greg,2021-04-07,,,,"3/24 pulled" +2021,joule,138,greg,2021-04-15,,,,"3/24 pulled" +2021,joule,138,greg,2021-04-21,,,,"3/24 pulled" +2021,joule,138,greg,2021-04-28,,,,"3/24 pulled" +2021,joule,309,greg,2021-02-24,,,,"4/28 1 dead chick below nest, Mercury" +2021,joule,309,greg,2021-03-03,,,,"4/28 1 dead chick below nest, Mercury" +2021,joule,309,greg,2021-03-10,2,,incubating,"4/28 1 dead chick below nest, Mercury" +2021,joule,309,greg,2021-03-17,3,,incubating,"4/28 1 dead chick below nest, Mercury" +2021,joule,309,greg,2021-03-24,3,,incubating,"4/28 1 dead chick below nest, Mercury" +2021,joule,309,greg,2021-03-31,3,,incubating,"4/28 1 dead chick below nest, Mercury" +2021,joule,309,greg,2021-04-07,,3,nestling,"4/28 1 dead chick below nest, Mercury" +2021,joule,309,greg,2021-04-15,,2,nestling,"4/28 1 dead chick below nest, Mercury" +2021,joule,309,greg,2021-04-21,,3,nestling,"4/28 1 dead chick below nest, Mercury" +2021,joule,309,greg,2021-04-28,,2,fledged,"4/28 1 dead chick below nest, Mercury" +2021,joule,429,greg,2021-02-24,,,, +2021,joule,429,greg,2021-03-03,,,, +2021,joule,429,greg,2021-03-10,2,,incubating, +2021,joule,429,greg,2021-03-17,2,,incubating, +2021,joule,429,greg,2021-03-24,2,,incubating, +2021,joule,429,greg,2021-03-31,2,,incubating, +2021,joule,429,greg,2021-04-07,,1,nestling, +2021,joule,429,greg,2021-04-15,,,missed, +2021,joule,429,greg,2021-04-21,,1,nestling, +2021,joule,429,greg,2021-04-28,,,missed, +2021,joule,140,greg,2021-02-24,1,,incubating,"3/24 collapsed and pulled" +2021,joule,140,greg,2021-03-03,3,,incubating,"3/24 collapsed and pulled" +2021,joule,140,greg,2021-03-10,3,,incubating,"3/24 collapsed and pulled" +2021,joule,140,greg,2021-03-17,3,,incubating,"3/24 collapsed and pulled" +2021,joule,140,greg,2021-03-24,0,,empty,"3/24 collapsed and pulled" +2021,joule,140,greg,2021-03-31,,,,"3/24 collapsed and pulled" +2021,joule,140,greg,2021-04-07,,,,"3/24 collapsed and pulled" +2021,joule,140,greg,2021-04-15,,,,"3/24 collapsed and pulled" +2021,joule,140,greg,2021-04-21,,,,"3/24 collapsed and pulled" +2021,joule,140,greg,2021-04-28,,,,"3/24 collapsed and pulled" +2021,joule,227,greg,2021-02-24,2,,incubating, +2021,joule,227,greg,2021-03-03,3,,incubating, +2021,joule,227,greg,2021-03-10,3,,incubating, +2021,joule,227,greg,2021-03-17,3,,incubating, +2021,joule,227,greg,2021-03-24,,2,nestling, +2021,joule,227,greg,2021-03-31,,3,nestling, +2021,joule,227,greg,2021-04-07,,3,nestling, +2021,joule,227,greg,2021-04-15,,3,nestling, +2021,joule,227,greg,2021-04-21,,3,nestling, +2021,joule,227,greg,2021-04-28,0,0,empty, +2021,joule,77,greg,2021-02-24,,,,"4/21 mercury" +2021,joule,77,greg,2021-03-03,0,,empty,"4/21 mercury" +2021,joule,77,greg,2021-03-10,2,,incubating,"4/21 mercury" +2021,joule,77,greg,2021-03-17,2,,incubating,"4/21 mercury" +2021,joule,77,greg,2021-03-24,2,,incubating,"4/21 mercury" +2021,joule,77,greg,2021-03-31,2,,incubating,"4/21 mercury" +2021,joule,77,greg,2021-04-07,1,1,hatching,"4/21 mercury" +2021,joule,77,greg,2021-04-15,,1,nestling,"4/21 mercury" +2021,joule,77,greg,2021-04-21,,1,nestling,"4/21 mercury" +2021,joule,77,greg,2021-04-28,,1,fledged,"4/21 mercury" +2021,joule,161,greg,2021-02-24,,,,"3/31 drone flagged 4/7 flag removed, 4/15 mercury" +2021,joule,161,greg,2021-03-03,3,,incubating,"3/31 drone flagged 4/7 flag removed, 4/15 mercury" +2021,joule,161,greg,2021-03-10,3,,incubating,"3/31 drone flagged 4/7 flag removed, 4/15 mercury" +2021,joule,161,greg,2021-03-17,3,,incubating,"3/31 drone flagged 4/7 flag removed, 4/15 mercury" +2021,joule,161,greg,2021-03-24,3,,incubating,"3/31 drone flagged 4/7 flag removed, 4/15 mercury" +2021,joule,161,greg,2021-03-31,1,2,hatching,"3/31 drone flagged 4/7 flag removed, 4/15 mercury" +2021,joule,161,greg,2021-04-07,1,2,hatching,"3/31 drone flagged 4/7 flag removed, 4/15 mercury" +2021,joule,161,greg,2021-04-15,,2,nestling,"3/31 drone flagged 4/7 flag removed, 4/15 mercury" +2021,joule,161,greg,2021-04-21,,2,nestling,"3/31 drone flagged 4/7 flag removed, 4/15 mercury" +2021,joule,161,greg,2021-04-28,0,0,empty,"3/31 drone flagged 4/7 flag removed, 4/15 mercury" +2021,joule,106,greg,2021-02-24,0,0,pre_flagged,"3/31 collapsed and gone" +2021,joule,106,greg,2021-03-03,3,,incubating,"3/31 collapsed and gone" +2021,joule,106,greg,2021-03-10,0,,empty,"3/31 collapsed and gone" +2021,joule,106,greg,2021-03-17,,,,"3/31 collapsed and gone" +2021,joule,106,greg,2021-03-24,,,,"3/31 collapsed and gone" +2021,joule,106,greg,2021-03-31,,,,"3/31 collapsed and gone" +2021,joule,106,greg,2021-04-07,,,,"3/31 collapsed and gone" +2021,joule,106,greg,2021-04-15,,,,"3/31 collapsed and gone" +2021,joule,106,greg,2021-04-21,,,,"3/31 collapsed and gone" +2021,joule,106,greg,2021-04-28,,,,"3/31 collapsed and gone" +2021,joule,229,greg,2021-02-24,3,,incubating,"4/21 mercury" +2021,joule,229,greg,2021-03-03,3,,incubating,"4/21 mercury" +2021,joule,229,greg,2021-03-10,3,,incubating,"4/21 mercury" +2021,joule,229,greg,2021-03-17,3,,incubating,"4/21 mercury" +2021,joule,229,greg,2021-03-24,,3,nestling,"4/21 mercury" +2021,joule,229,greg,2021-03-31,,2,nestling,"4/21 mercury" +2021,joule,229,greg,2021-04-07,,2,nestling,"4/21 mercury" +2021,joule,229,greg,2021-04-15,,2,nestling,"4/21 mercury" +2021,joule,229,greg,2021-04-21,,2,nestling,"4/21 mercury" +2021,joule,229,greg,2021-04-28,0,0,empty,"4/21 mercury" +2021,joule,142,greg,2021-02-24,3,,incubating,"3/24 collapsed and pulled" +2021,joule,142,greg,2021-03-03,3,,incubating,"3/24 collapsed and pulled" +2021,joule,142,greg,2021-03-10,3,,incubating,"3/24 collapsed and pulled" +2021,joule,142,greg,2021-03-17,3,,incubating,"3/24 collapsed and pulled" +2021,joule,142,greg,2021-03-24,0,0,empty,"3/24 collapsed and pulled" +2021,joule,142,greg,2021-03-31,,,,"3/24 collapsed and pulled" +2021,joule,142,greg,2021-04-07,,,,"3/24 collapsed and pulled" +2021,joule,142,greg,2021-04-15,,,,"3/24 collapsed and pulled" +2021,joule,142,greg,2021-04-21,,,,"3/24 collapsed and pulled" +2021,joule,142,greg,2021-04-28,,,,"3/24 collapsed and pulled" +2021,joule,108,greg,2021-02-24,1,,incubating, +2021,joule,108,greg,2021-03-03,3,,incubating, +2021,joule,108,greg,2021-03-10,3,,incubating, +2021,joule,108,greg,2021-03-17,3,,incubating, +2021,joule,108,greg,2021-03-24,2,1,pipping, +2021,joule,108,greg,2021-03-31,,2,nestling, +2021,joule,108,greg,2021-04-07,,2,nestling, +2021,joule,108,greg,2021-04-15,,2,nestling, +2021,joule,108,greg,2021-04-21,,2,nestling, +2021,joule,108,greg,2021-04-28,0,0,empty, +2021,joule,231,greg,2021-02-24,0,0,pre_flagged,"3/10 collapsed and pulled, 4/7 orange drone flag" +2021,joule,231,greg,2021-03-03,1,,incubating,"3/10 collapsed and pulled, 4/7 orange drone flag" +2021,joule,231,greg,2021-03-10,0,,empty,"3/10 collapsed and pulled, 4/7 orange drone flag" +2021,joule,231,greg,2021-03-17,,,,"3/10 collapsed and pulled, 4/7 orange drone flag" +2021,joule,231,greg,2021-03-24,,,,"3/10 collapsed and pulled, 4/7 orange drone flag" +2021,joule,231,greg,2021-03-31,,,,"3/10 collapsed and pulled, 4/7 orange drone flag" +2021,joule,231,greg,2021-04-07,,,,"3/10 collapsed and pulled, 4/7 orange drone flag" +2021,joule,231,greg,2021-04-15,,,,"3/10 collapsed and pulled, 4/7 orange drone flag" +2021,joule,231,greg,2021-04-21,,,,"3/10 collapsed and pulled, 4/7 orange drone flag" +2021,joule,231,greg,2021-04-28,,,,"3/10 collapsed and pulled, 4/7 orange drone flag" +2021,joule,110,greg,2021-02-24,1,,incubating,"4/15 mercury" +2021,joule,110,greg,2021-03-03,2,,incubating,"4/15 mercury" +2021,joule,110,greg,2021-03-10,2,,incubating,"4/15 mercury" +2021,joule,110,greg,2021-03-17,2,,incubating,"4/15 mercury" +2021,joule,110,greg,2021-03-24,,2,nestling,"4/15 mercury" +2021,joule,110,greg,2021-03-31,,2,nestling,"4/15 mercury" +2021,joule,110,greg,2021-04-07,,2,nestling,"4/15 mercury" +2021,joule,110,greg,2021-04-15,,2,nestling,"4/15 mercury" +2021,joule,110,greg,2021-04-21,,2,nestling,"4/15 mercury" +2021,joule,110,greg,2021-04-28,0,0,empty,"4/15 mercury" +2021,joule,233,greg,2021-02-24,3,,incubating,"3/24 collapsed and pulled" +2021,joule,233,greg,2021-03-03,0,,empty,"3/24 collapsed and pulled" +2021,joule,233,greg,2021-03-10,,,,"3/24 collapsed and pulled" +2021,joule,233,greg,2021-03-17,,,,"3/24 collapsed and pulled" +2021,joule,233,greg,2021-03-24,,,,"3/24 collapsed and pulled" +2021,joule,233,greg,2021-03-31,,,,"3/24 collapsed and pulled" +2021,joule,233,greg,2021-04-07,,,,"3/24 collapsed and pulled" +2021,joule,233,greg,2021-04-15,,,,"3/24 collapsed and pulled" +2021,joule,233,greg,2021-04-21,,,,"3/24 collapsed and pulled" +2021,joule,233,greg,2021-04-28,,,,"3/24 collapsed and pulled" +2021,joule,144,greg,2021-02-24,0,0,pre_flagged,"4/21 drone flagged" +2021,joule,144,greg,2021-03-03,3,,incubating,"4/21 drone flagged" +2021,joule,144,greg,2021-03-10,3,,incubating,"4/21 drone flagged" +2021,joule,144,greg,2021-03-17,3,,incubating,"4/21 drone flagged" +2021,joule,144,greg,2021-03-24,3,,incubating,"4/21 drone flagged" +2021,joule,144,greg,2021-03-31,,3,nestling,"4/21 drone flagged" +2021,joule,144,greg,2021-04-07,,3,nestling,"4/21 drone flagged" +2021,joule,144,greg,2021-04-15,,3,nestling,"4/21 drone flagged" +2021,joule,144,greg,2021-04-21,,2,nestling,"4/21 drone flagged" +2021,joule,144,greg,2021-04-28,0,0,empty,"4/21 drone flagged" +2021,joule,146,greg,2021-02-24,2,,incubating,"3/3 collapsed and pulled" +2021,joule,146,greg,2021-03-03,0,,empty,"3/3 collapsed and pulled" +2021,joule,146,greg,2021-03-10,,,,"3/3 collapsed and pulled" +2021,joule,146,greg,2021-03-17,,,,"3/3 collapsed and pulled" +2021,joule,146,greg,2021-03-24,,,,"3/3 collapsed and pulled" +2021,joule,146,greg,2021-03-31,,,,"3/3 collapsed and pulled" +2021,joule,146,greg,2021-04-07,,,,"3/3 collapsed and pulled" +2021,joule,146,greg,2021-04-15,,,,"3/3 collapsed and pulled" +2021,joule,146,greg,2021-04-21,,,,"3/3 collapsed and pulled" +2021,joule,146,greg,2021-04-28,,,,"3/3 collapsed and pulled" +2021,joule,235,greg,2021-02-24,1,,incubating,"3/24 chick was probably wet day before, 4/21 drone flagged" +2021,joule,235,greg,2021-03-03,3,,incubating,"3/24 chick was probably wet day before, 4/21 drone flagged" +2021,joule,235,greg,2021-03-10,3,,incubating,"3/24 chick was probably wet day before, 4/21 drone flagged" +2021,joule,235,greg,2021-03-17,3,,incubating,"3/24 chick was probably wet day before, 4/21 drone flagged" +2021,joule,235,greg,2021-03-24,1,2,hatching,"3/24 chick was probably wet day before, 4/21 drone flagged" +2021,joule,235,greg,2021-03-31,,3,nestling,"3/24 chick was probably wet day before, 4/21 drone flagged" +2021,joule,235,greg,2021-04-07,,3,nestling,"3/24 chick was probably wet day before, 4/21 drone flagged" +2021,joule,235,greg,2021-04-15,,3,nestling,"3/24 chick was probably wet day before, 4/21 drone flagged" +2021,joule,235,greg,2021-04-21,,2,nestling,"3/24 chick was probably wet day before, 4/21 drone flagged" +2021,joule,235,greg,2021-04-28,0,0,empty,"3/24 chick was probably wet day before, 4/21 drone flagged" +2021,joule,148,greg,2021-02-24,1,,incubating, +2021,joule,148,greg,2021-03-03,3,,incubating, +2021,joule,148,greg,2021-03-10,3,,incubating, +2021,joule,148,greg,2021-03-17,3,,incubating, +2021,joule,148,greg,2021-03-24,1,2,pipping, +2021,joule,148,greg,2021-03-31,,3,nestling, +2021,joule,148,greg,2021-04-07,,3,nestling, +2021,joule,148,greg,2021-04-15,,3,nestling, +2021,joule,148,greg,2021-04-21,,3,nestling, +2021,joule,148,greg,2021-04-28,0,0,empty, +2021,joule,116,rsha,2021-02-24,2,,incubating, +2021,joule,116,rsha,2021-03-03,2,,incubating, +2021,joule,116,rsha,2021-03-10,2,,incubating, +2021,joule,116,rsha,2021-03-17,,2,wet_chick, +2021,joule,116,rsha,2021-03-24,,2,nestling, +2021,joule,116,rsha,2021-03-31,,2,nestling, +2021,joule,116,rsha,2021-04-07,,2,nestling, +2021,joule,116,rsha,2021-04-15,,2,nestling, +2021,joule,116,rsha,2021-04-21,,2,nestling, +2021,joule,116,rsha,2021-04-28,,2,fledged, +2021,joule,237,greg,2021-02-24,1,,incubating, +2021,joule,237,greg,2021-03-03,3,,incubating, +2021,joule,237,greg,2021-03-10,3,,incubating, +2021,joule,237,greg,2021-03-17,3,,incubating, +2021,joule,237,greg,2021-03-24,1,2,wet_chick, +2021,joule,237,greg,2021-03-31,,3,nestling, +2021,joule,237,greg,2021-04-07,,3,nestling, +2021,joule,237,greg,2021-04-15,,1,nestling, +2021,joule,237,greg,2021-04-21,0,0,empty, +2021,joule,237,greg,2021-04-28,,,, +2021,joule,150,greg,2021-02-24,1,,incubating,"3/10 collapsed and pulled" +2021,joule,150,greg,2021-03-03,0,,empty,"3/10 collapsed and pulled" +2021,joule,150,greg,2021-03-10,,,,"3/10 collapsed and pulled" +2021,joule,150,greg,2021-03-17,,,,"3/10 collapsed and pulled" +2021,joule,150,greg,2021-03-24,,,,"3/10 collapsed and pulled" +2021,joule,150,greg,2021-03-31,,,,"3/10 collapsed and pulled" +2021,joule,150,greg,2021-04-07,,,,"3/10 collapsed and pulled" +2021,joule,150,greg,2021-04-15,,,,"3/10 collapsed and pulled" +2021,joule,150,greg,2021-04-21,,,,"3/10 collapsed and pulled" +2021,joule,150,greg,2021-04-28,,,,"3/10 collapsed and pulled" +2021,joule,239,greg,2021-02-24,3,,incubating,"4/21 drone flagged" +2021,joule,239,greg,2021-03-03,3,,incubating,"4/21 drone flagged" +2021,joule,239,greg,2021-03-10,3,,incubating,"4/21 drone flagged" +2021,joule,239,greg,2021-03-17,3,,incubating,"4/21 drone flagged" +2021,joule,239,greg,2021-03-24,,3,nestling,"4/21 drone flagged" +2021,joule,239,greg,2021-03-31,,3,nestling,"4/21 drone flagged" +2021,joule,239,greg,2021-04-07,,3,nestling,"4/21 drone flagged" +2021,joule,239,greg,2021-04-15,,,missed,"4/21 drone flagged" +2021,joule,239,greg,2021-04-21,,3,nestling,"4/21 drone flagged" +2021,joule,239,greg,2021-04-28,0,0,empty,"4/21 drone flagged" +2021,joule,152,greg,2021-02-24,3,,incubating,"4/15 mercury" +2021,joule,152,greg,2021-03-03,3,,incubating,"4/15 mercury" +2021,joule,152,greg,2021-03-10,2,,incubating,"4/15 mercury" +2021,joule,152,greg,2021-03-17,3,,incubating,"4/15 mercury" +2021,joule,152,greg,2021-03-24,,3,nestling,"4/15 mercury" +2021,joule,152,greg,2021-03-31,,3,nestling,"4/15 mercury" +2021,joule,152,greg,2021-04-07,,3,nestling,"4/15 mercury" +2021,joule,152,greg,2021-04-15,,3,nestling,"4/15 mercury" +2021,joule,152,greg,2021-04-21,,3,nestling,"4/15 mercury" +2021,joule,152,greg,2021-04-28,0,0,empty,"4/15 mercury" +2021,joule,120,greg,2021-02-24,0,,pre_flagged,"4/21 drone flagged" +2021,joule,120,greg,2021-03-03,2,,incubating,"4/21 drone flagged" +2021,joule,120,greg,2021-03-10,2,,incubating,"4/21 drone flagged" +2021,joule,120,greg,2021-03-17,2,,incubating,"4/21 drone flagged" +2021,joule,120,greg,2021-03-24,2,,incubating,"4/21 drone flagged" +2021,joule,120,greg,2021-03-31,,2,nestling,"4/21 drone flagged" +2021,joule,120,greg,2021-04-07,,2,nestling,"4/21 drone flagged" +2021,joule,120,greg,2021-04-15,,2,nestling,"4/21 drone flagged" +2021,joule,120,greg,2021-04-21,,1,nestling,"4/21 drone flagged" +2021,joule,120,greg,2021-04-28,0,0,empty,"4/21 drone flagged" +2021,joule,241,greg,2021-02-24,0,,pre_flagged,"3/31 Could be small heron eggs" +2021,joule,241,greg,2021-03-03,2,,incubating,"3/31 Could be small heron eggs" +2021,joule,241,greg,2021-03-10,2,,incubating,"3/31 Could be small heron eggs" +2021,joule,241,greg,2021-03-17,0,,empty,"3/31 Could be small heron eggs" +2021,joule,241,greg,2021-03-24,0,,empty,"3/31 Could be small heron eggs" +2021,joule,241,greg,2021-03-31,1,,incubating,"3/31 Could be small heron eggs" +2021,joule,241,greg,2021-04-07,2,,incubating,"3/31 Could be small heron eggs" +2021,joule,241,greg,2021-04-15,2,,incubating,"3/31 Could be small heron eggs" +2021,joule,241,greg,2021-04-21,2,,incubating,"3/31 Could be small heron eggs" +2021,joule,241,greg,2021-04-28,0,0,empty,"3/31 Could be small heron eggs" +2021,joule,122,greg,2021-02-24,1,,incubating, +2021,joule,122,greg,2021-03-03,2,,incubating, +2021,joule,122,greg,2021-03-10,0,,empty, +2021,joule,122,greg,2021-03-17,,,, +2021,joule,122,greg,2021-03-24,,,, +2021,joule,122,greg,2021-03-31,,,, +2021,joule,122,greg,2021-04-07,,,, +2021,joule,122,greg,2021-04-15,,,, +2021,joule,122,greg,2021-04-21,,,, +2021,joule,122,greg,2021-04-28,,,, +2021,jerrod,79,greg,2021-03-03,3,,incubating,"4/15 mercury & 1 dead chick" +2021,jerrod,79,greg,2021-03-10,3,,incubating,"4/15 mercury & 1 dead chick" +2021,jerrod,79,greg,2021-03-17,2,1,hatching,"4/15 mercury & 1 dead chick" +2021,jerrod,79,greg,2021-03-24,,3,nestling,"4/15 mercury & 1 dead chick" +2021,jerrod,79,greg,2021-03-31,,3,nestling,"4/15 mercury & 1 dead chick" +2021,jerrod,79,greg,2021-04-07,,3,nestling,"4/15 mercury & 1 dead chick" +2021,jerrod,79,greg,2021-04-15,,2,nestling,"4/15 mercury & 1 dead chick" +2021,jerrod,79,greg,2021-04-21,,0,fledged,"4/15 mercury & 1 dead chick" +2021,jerrod,79,greg,2021-04-26,,,,"4/15 mercury & 1 dead chick" +2021,jerrod,172,greg,2021-03-03,1,,incubating,"3/17 pulled" +2021,jerrod,172,greg,2021-03-10,0,,empty,"3/17 pulled" +2021,jerrod,172,greg,2021-03-17,,,,"3/17 pulled" +2021,jerrod,172,greg,2021-03-24,,,,"3/17 pulled" +2021,jerrod,172,greg,2021-03-31,,,,"3/17 pulled" +2021,jerrod,172,greg,2021-04-07,,,,"3/17 pulled" +2021,jerrod,172,greg,2021-04-15,,,,"3/17 pulled" +2021,jerrod,172,greg,2021-04-21,,,,"3/17 pulled" +2021,jerrod,172,greg,2021-04-26,,,,"3/17 pulled" +2021,jerrod,81,greg,2021-03-03,3,,incubating,"3/24 dead chick on ground 4/7 mercury" +2021,jerrod,81,greg,2021-03-10,3,,incubating,"3/24 dead chick on ground 4/7 mercury" +2021,jerrod,81,greg,2021-03-17,,3,nestling,"3/24 dead chick on ground 4/7 mercury" +2021,jerrod,81,greg,2021-03-24,,2,nestling,"3/24 dead chick on ground 4/7 mercury" +2021,jerrod,81,greg,2021-03-31,,2,nestling,"3/24 dead chick on ground 4/7 mercury" +2021,jerrod,81,greg,2021-04-07,,2,nestling,"3/24 dead chick on ground 4/7 mercury" +2021,jerrod,81,greg,2021-04-15,,2,nestling,"3/24 dead chick on ground 4/7 mercury" +2021,jerrod,81,greg,2021-04-21,,0,fledged,"3/24 dead chick on ground 4/7 mercury" +2021,jerrod,81,greg,2021-04-26,,,,"3/24 dead chick on ground 4/7 mercury" +2021,jerrod,163,greg,2021-03-03,3,,incubating,"3/24 collapsed and pulled" +2021,jerrod,163,greg,2021-03-10,0,,empty,"3/24 collapsed and pulled" +2021,jerrod,163,greg,2021-03-17,,,,"3/24 collapsed and pulled" +2021,jerrod,163,greg,2021-03-24,,,,"3/24 collapsed and pulled" +2021,jerrod,163,greg,2021-03-31,,,,"3/24 collapsed and pulled" +2021,jerrod,163,greg,2021-04-07,,,,"3/24 collapsed and pulled" +2021,jerrod,163,greg,2021-04-15,,,,"3/24 collapsed and pulled" +2021,jerrod,163,greg,2021-04-21,,,,"3/24 collapsed and pulled" +2021,jerrod,163,greg,2021-04-26,,,,"3/24 collapsed and pulled" +2021,jerrod,174/248,greg,2021-03-03,3,,incubating,"3/10 #174 flagging dissapeared, remarked with #248, 4/15 mercury" +2021,jerrod,174/248,greg,2021-03-10,3,,incubating,"3/10 #174 flagging dissapeared, remarked with #248, 4/15 mercury" +2021,jerrod,174/248,greg,2021-03-17,1,1,hatching,"3/10 #174 flagging dissapeared, remarked with #248, 4/15 mercury" +2021,jerrod,174/248,greg,2021-03-24,1,1,hatching,"3/10 #174 flagging dissapeared, remarked with #248, 4/15 mercury" +2021,jerrod,174/248,greg,2021-03-31,1,1,hatching,"3/10 #174 flagging dissapeared, remarked with #248, 4/15 mercury" +2021,jerrod,174/248,greg,2021-04-07,,1,nestling,"3/10 #174 flagging dissapeared, remarked with #248, 4/15 mercury" +2021,jerrod,174/248,greg,2021-04-15,,1,nestling,"3/10 #174 flagging dissapeared, remarked with #248, 4/15 mercury" +2021,jerrod,174/248,greg,2021-04-21,,0,fledged,"3/10 #174 flagging dissapeared, remarked with #248, 4/15 mercury" +2021,jerrod,174/248,greg,2021-04-26,,,,"3/10 #174 flagging dissapeared, remarked with #248, 4/15 mercury" +2021,jerrod,176,gbhe,2021-03-03,3,,incubating, +2021,jerrod,176,gbhe,2021-03-10,3,,incubating, +2021,jerrod,176,gbhe,2021-03-17,,3,nestling, +2021,jerrod,176,gbhe,2021-03-24,,2,nestling, +2021,jerrod,176,gbhe,2021-03-31,,3,nestling, +2021,jerrod,176,gbhe,2021-04-07,,2,nestling, +2021,jerrod,176,gbhe,2021-04-15,,2,nestling, +2021,jerrod,176,gbhe,2021-04-21,,2,nestling, +2021,jerrod,176,gbhe,2021-04-26,,2,fledged, +2021,jerrod,85,greg,2021-03-03,3,,incubating, +2021,jerrod,85,greg,2021-03-10,,3,nestling, +2021,jerrod,85,greg,2021-03-17,,3,nestling, +2021,jerrod,85,greg,2021-03-24,,2,nestling, +2021,jerrod,85,greg,2021-03-31,,2,nestling, +2021,jerrod,85,greg,2021-04-07,,2,nestling, +2021,jerrod,85,greg,2021-04-15,,0,fledged, +2021,jerrod,85,greg,2021-04-21,,0,fledged, +2021,jerrod,85,greg,2021-04-26,,,, +2021,jerrod,165,greg,2021-03-03,0,0,pre_flagged, +2021,jerrod,165,greg,2021-03-10,1,,incubating, +2021,jerrod,165,greg,2021-03-17,0,,empty, +2021,jerrod,165,greg,2021-03-24,,2,nestling, +2021,jerrod,165,greg,2021-03-31,,2,nestling, +2021,jerrod,165,greg,2021-04-07,,2,nestling, +2021,jerrod,165,greg,2021-04-15,,2,nestling, +2021,jerrod,165,greg,2021-04-21,,0,fledged, +2021,jerrod,165,greg,2021-04-26,,,, +2021,jerrod,178,greg,2021-03-03,3,,incubating,"3/24 chick found outside nest, appeared to be harassed by other birds. Returned to nest 4/7 mercury" +2021,jerrod,178,greg,2021-03-10,2,1,wet_chick,"3/24 chick found outside nest, appeared to be harassed by other birds. Returned to nest 4/7 mercury" +2021,jerrod,178,greg,2021-03-17,,3,nestling,"3/24 chick found outside nest, appeared to be harassed by other birds. Returned to nest 4/7 mercury" +2021,jerrod,178,greg,2021-03-24,,1,nestling,"3/24 chick found outside nest, appeared to be harassed by other birds. Returned to nest 4/7 mercury" +2021,jerrod,178,greg,2021-03-31,,1,nestling,"3/24 chick found outside nest, appeared to be harassed by other birds. Returned to nest 4/7 mercury" +2021,jerrod,178,greg,2021-04-07,,1,nestling,"3/24 chick found outside nest, appeared to be harassed by other birds. Returned to nest 4/7 mercury" +2021,jerrod,178,greg,2021-04-15,,0,fledged,"3/24 chick found outside nest, appeared to be harassed by other birds. Returned to nest 4/7 mercury" +2021,jerrod,178,greg,2021-04-21,,0,fledged,"3/24 chick found outside nest, appeared to be harassed by other birds. Returned to nest 4/7 mercury" +2021,jerrod,178,greg,2021-04-26,,,,"3/24 chick found outside nest, appeared to be harassed by other birds. Returned to nest 4/7 mercury" +2021,jerrod,87,greg,2021-03-03,4,,incubating,"4/15 mercury" +2021,jerrod,87,greg,2021-03-10,4,,incubating,"4/15 mercury" +2021,jerrod,87,greg,2021-03-17,4,,incubating,"4/15 mercury" +2021,jerrod,87,greg,2021-03-24,3,,incubating,"4/15 mercury" +2021,jerrod,87,greg,2021-03-31,,3,nestling,"4/15 mercury" +2021,jerrod,87,greg,2021-04-07,,3,nestling,"4/15 mercury" +2021,jerrod,87,greg,2021-04-15,,3,nestling,"4/15 mercury" +2021,jerrod,87,greg,2021-04-21,,3,nestling,"4/15 mercury" +2021,jerrod,87,greg,2021-04-26,0,0,empty,"4/15 mercury" +2021,jerrod,180,greg,2021-03-03,1,,incubating,"3/31 drone flagged 4/7 drone flag removed" +2021,jerrod,180,greg,2021-03-10,2,,incubating,"3/31 drone flagged 4/7 drone flag removed" +2021,jerrod,180,greg,2021-03-17,2,,incubating,"3/31 drone flagged 4/7 drone flag removed" +2021,jerrod,180,greg,2021-03-24,0,,empty,"3/31 drone flagged 4/7 drone flag removed" +2021,jerrod,180,greg,2021-03-31,,,,"3/31 drone flagged 4/7 drone flag removed" +2021,jerrod,180,greg,2021-04-07,,,,"3/31 drone flagged 4/7 drone flag removed" +2021,jerrod,180,greg,2021-04-15,,,,"3/31 drone flagged 4/7 drone flag removed" +2021,jerrod,180,greg,2021-04-21,,,,"3/31 drone flagged 4/7 drone flag removed" +2021,jerrod,180,greg,2021-04-26,,,,"3/31 drone flagged 4/7 drone flag removed" +2021,jerrod,182,greg,2021-03-03,2,,incubating,"4/15 mercury" +2021,jerrod,182,greg,2021-03-10,2,,incubating,"4/15 mercury" +2021,jerrod,182,greg,2021-03-17,,2,nestling,"4/15 mercury" +2021,jerrod,182,greg,2021-03-24,,2,nestling,"4/15 mercury" +2021,jerrod,182,greg,2021-03-31,,2,nestling,"4/15 mercury" +2021,jerrod,182,greg,2021-04-07,,2,nestling,"4/15 mercury" +2021,jerrod,182,greg,2021-04-15,,2,nestling,"4/15 mercury" +2021,jerrod,182,greg,2021-04-21,,0,fledged,"4/15 mercury" +2021,jerrod,182,greg,2021-04-26,,,,"4/15 mercury" +2021,jerrod,167,greg,2021-03-03,3,,incubating, +2021,jerrod,167,greg,2021-03-10,3,,incubating, +2021,jerrod,167,greg,2021-03-17,3,,pipping, +2021,jerrod,167,greg,2021-03-24,,2,nestling, +2021,jerrod,167,greg,2021-03-31,,2,nestling, +2021,jerrod,167,greg,2021-04-07,,2,nestling, +2021,jerrod,167,greg,2021-04-15,,2,nestling, +2021,jerrod,167,greg,2021-04-21,,0,fledged, +2021,jerrod,167,greg,2021-04-26,,,, +2021,jerrod,169,greg,2021-03-03,0,0,pre_flagged, +2021,jerrod,169,greg,2021-03-10,2,,incubating, +2021,jerrod,169,greg,2021-03-17,3,,incubating, +2021,jerrod,169,greg,2021-03-24,3,,incubating, +2021,jerrod,169,greg,2021-03-31,,0,empty, +2021,jerrod,169,greg,2021-04-07,,,, +2021,jerrod,169,greg,2021-04-15,,,, +2021,jerrod,169,greg,2021-04-21,,,, +2021,jerrod,169,greg,2021-04-26,,,, +2021,jerrod,89,greg,2021-03-03,3,,incubating,"3/24 1 dead chick present in addtion to live chick, egg present also likely dead 3/31 1 Dead chick outside of nestcup, 4/15 drone flag (over 89 & 91)" +2021,jerrod,89,greg,2021-03-10,1,2,hatching,"3/24 1 dead chick present in addtion to live chick, egg present also likely dead 3/31 1 Dead chick outside of nestcup, 4/15 drone flag (over 89 & 91)" +2021,jerrod,89,greg,2021-03-17,1,2,hatching,"3/24 1 dead chick present in addtion to live chick, egg present also likely dead 3/31 1 Dead chick outside of nestcup, 4/15 drone flag (over 89 & 91)" +2021,jerrod,89,greg,2021-03-24,1,1,hatching,"3/24 1 dead chick present in addtion to live chick, egg present also likely dead 3/31 1 Dead chick outside of nestcup, 4/15 drone flag (over 89 & 91)" +2021,jerrod,89,greg,2021-03-31,,1,nestling,"3/24 1 dead chick present in addtion to live chick, egg present also likely dead 3/31 1 Dead chick outside of nestcup, 4/15 drone flag (over 89 & 91)" +2021,jerrod,89,greg,2021-04-07,0,,empty,"3/24 1 dead chick present in addtion to live chick, egg present also likely dead 3/31 1 Dead chick outside of nestcup, 4/15 drone flag (over 89 & 91)" +2021,jerrod,89,greg,2021-04-15,,,,"3/24 1 dead chick present in addtion to live chick, egg present also likely dead 3/31 1 Dead chick outside of nestcup, 4/15 drone flag (over 89 & 91)" +2021,jerrod,89,greg,2021-04-21,,,,"3/24 1 dead chick present in addtion to live chick, egg present also likely dead 3/31 1 Dead chick outside of nestcup, 4/15 drone flag (over 89 & 91)" +2021,jerrod,89,greg,2021-04-26,,,,"3/24 1 dead chick present in addtion to live chick, egg present also likely dead 3/31 1 Dead chick outside of nestcup, 4/15 drone flag (over 89 & 91)" +2021,jerrod,91,greg,2021-03-03,3,,incubating, +2021,jerrod,91,greg,2021-03-10,3,,incubating, +2021,jerrod,91,greg,2021-03-17,0,,empty, +2021,jerrod,91,greg,2021-03-24,,,, +2021,jerrod,91,greg,2021-03-31,,,, +2021,jerrod,91,greg,2021-04-07,,,, +2021,jerrod,91,greg,2021-04-15,,,, +2021,jerrod,91,greg,2021-04-21,,,, +2021,jerrod,91,greg,2021-04-26,,,, +2021,jerrod,184,greg,2021-03-03,2,,incubating,"4/21 mercury, drone flag" +2021,jerrod,184,greg,2021-03-10,2,,incubating,"4/21 mercury, drone flag" +2021,jerrod,184,greg,2021-03-17,,2,nestling,"4/21 mercury, drone flag" +2021,jerrod,184,greg,2021-03-24,,2,nestling,"4/21 mercury, drone flag" +2021,jerrod,184,greg,2021-03-31,,2,nestling,"4/21 mercury, drone flag" +2021,jerrod,184,greg,2021-04-07,0,,empty,"4/21 mercury, drone flag" +2021,jerrod,184,greg,2021-04-15,,2,nestling,"4/21 mercury, drone flag" +2021,jerrod,184,greg,2021-04-21,,2,nestling,"4/21 mercury, drone flag" +2021,jerrod,184,greg,2021-04-26,0,0,empty,"4/21 mercury, drone flag" +2021,jerrod,186,greg,2021-03-03,2,,incubating,"3/31 drone flagged 4/7 drone flag removed" +2021,jerrod,186,greg,2021-03-10,2,,incubating,"3/31 drone flagged 4/7 drone flag removed" +2021,jerrod,186,greg,2021-03-17,2,,incubating,"3/31 drone flagged 4/7 drone flag removed" +2021,jerrod,186,greg,2021-03-24,,2,nestling,"3/31 drone flagged 4/7 drone flag removed" +2021,jerrod,186,greg,2021-03-31,,2,nestling,"3/31 drone flagged 4/7 drone flag removed" +2021,jerrod,186,greg,2021-04-07,,2,nestling,"3/31 drone flagged 4/7 drone flag removed" +2021,jerrod,186,greg,2021-04-15,,2,nestling,"3/31 drone flagged 4/7 drone flag removed" +2021,jerrod,186,greg,2021-04-21,,2,nestling,"3/31 drone flagged 4/7 drone flag removed" +2021,jerrod,186,greg,2021-04-26,0,0,empty,"3/31 drone flagged 4/7 drone flag removed" +2021,jerrod,171,greg,2021-03-03,3,,incubating,"3/31 drone flagged 4/7 drone flag removed, 4/7 nest pulled (collapsed)" +2021,jerrod,171,greg,2021-03-10,3,,incubating,"3/31 drone flagged 4/7 drone flag removed, 4/7 nest pulled (collapsed)" +2021,jerrod,171,greg,2021-03-17,0,,empty,"3/31 drone flagged 4/7 drone flag removed, 4/7 nest pulled (collapsed)" +2021,jerrod,171,greg,2021-03-24,,,,"3/31 drone flagged 4/7 drone flag removed, 4/7 nest pulled (collapsed)" +2021,jerrod,171,greg,2021-03-31,,,,"3/31 drone flagged 4/7 drone flag removed, 4/7 nest pulled (collapsed)" +2021,jerrod,171,greg,2021-04-07,,,,"3/31 drone flagged 4/7 drone flag removed, 4/7 nest pulled (collapsed)" +2021,jerrod,171,greg,2021-04-15,,,,"3/31 drone flagged 4/7 drone flag removed, 4/7 nest pulled (collapsed)" +2021,jerrod,171,greg,2021-04-21,,,,"3/31 drone flagged 4/7 drone flag removed, 4/7 nest pulled (collapsed)" +2021,jerrod,171,greg,2021-04-26,,,,"3/31 drone flagged 4/7 drone flag removed, 4/7 nest pulled (collapsed)" +2021,jerrod,93,greg,2021-03-03,2,,incubating, +2021,jerrod,93,greg,2021-03-10,2,,incubating, +2021,jerrod,93,greg,2021-03-17,0,,empty, +2021,jerrod,93,greg,2021-03-24,,,, +2021,jerrod,93,greg,2021-03-31,,,, +2021,jerrod,93,greg,2021-04-07,,,, +2021,jerrod,93,greg,2021-04-15,,,, +2021,jerrod,93,greg,2021-04-21,,,, +2021,jerrod,93,greg,2021-04-26,,,, +2021,jerrod,173,greg,2021-03-03,1,,incubating, +2021,jerrod,173,greg,2021-03-10,1,,pipping, +2021,jerrod,173,greg,2021-03-17,0,,empty, +2021,jerrod,173,greg,2021-03-24,,,, +2021,jerrod,173,greg,2021-03-31,,,, +2021,jerrod,173,greg,2021-04-07,,,, +2021,jerrod,173,greg,2021-04-15,,,, +2021,jerrod,173,greg,2021-04-21,,,, +2021,jerrod,173,greg,2021-04-26,,,, +2021,jerrod,188,greg,2021-03-03,2,,incubating,"4/7 collapsed and pulled" +2021,jerrod,188,greg,2021-03-10,3,,incubating,"4/7 collapsed and pulled" +2021,jerrod,188,greg,2021-03-17,0,,empty,"4/7 collapsed and pulled" +2021,jerrod,188,greg,2021-03-24,,,,"4/7 collapsed and pulled" +2021,jerrod,188,greg,2021-03-31,,,,"4/7 collapsed and pulled" +2021,jerrod,188,greg,2021-04-07,,,,"4/7 collapsed and pulled" +2021,jerrod,188,greg,2021-04-15,,,,"4/7 collapsed and pulled" +2021,jerrod,188,greg,2021-04-21,,,,"4/7 collapsed and pulled" +2021,jerrod,188,greg,2021-04-26,,,,"4/7 collapsed and pulled" +2021,jerrod,190,greg,2021-03-03,3,,incubating, +2021,jerrod,190,greg,2021-03-10,2,,incubating, +2021,jerrod,190,greg,2021-03-17,0,,empty, +2021,jerrod,190,greg,2021-03-24,,,, +2021,jerrod,190,greg,2021-03-31,,,, +2021,jerrod,190,greg,2021-04-07,,,, +2021,jerrod,190,greg,2021-04-15,,,, +2021,jerrod,190,greg,2021-04-21,,,, +2021,jerrod,190,greg,2021-04-26,,,, +2021,jerrod,95,greg,2021-03-03,2,,incubating,"4/7 collapsed and pulled" +2021,jerrod,95,greg,2021-03-10,2,,incubating,"4/7 collapsed and pulled" +2021,jerrod,95,greg,2021-03-17,0,,empty,"4/7 collapsed and pulled" +2021,jerrod,95,greg,2021-03-24,,,,"4/7 collapsed and pulled" +2021,jerrod,95,greg,2021-03-31,,,,"4/7 collapsed and pulled" +2021,jerrod,95,greg,2021-04-07,,,,"4/7 collapsed and pulled" +2021,jerrod,95,greg,2021-04-15,,,,"4/7 collapsed and pulled" +2021,jerrod,95,greg,2021-04-21,,,,"4/7 collapsed and pulled" +2021,jerrod,95,greg,2021-04-26,,,,"4/7 collapsed and pulled" +2021,jerrod,175,greg,2021-03-03,0,0,pre_flagged,"4/7 drone flagged, 4/21 mercury" +2021,jerrod,175,greg,2021-03-10,2,,incubating,"4/7 drone flagged, 4/21 mercury" +2021,jerrod,175,greg,2021-03-17,2,,incubating,"4/7 drone flagged, 4/21 mercury" +2021,jerrod,175,greg,2021-03-24,2,,incubating,"4/7 drone flagged, 4/21 mercury" +2021,jerrod,175,greg,2021-03-31,2,,incubating,"4/7 drone flagged, 4/21 mercury" +2021,jerrod,175,greg,2021-04-07,,2,nestling,"4/7 drone flagged, 4/21 mercury" +2021,jerrod,175,greg,2021-04-15,,2,nestling,"4/7 drone flagged, 4/21 mercury" +2021,jerrod,175,greg,2021-04-21,,2,nestling,"4/7 drone flagged, 4/21 mercury" +2021,jerrod,175,greg,2021-04-26,,2,fledged,"4/7 drone flagged, 4/21 mercury" +2021,jerrod,177,greg,2021-03-03,3,,incubating,"3/10 collapsed and pulled" +2021,jerrod,177,greg,2021-03-10,0,,empty,"3/10 collapsed and pulled" +2021,jerrod,177,greg,2021-03-17,,,,"3/10 collapsed and pulled" +2021,jerrod,177,greg,2021-03-24,,,,"3/10 collapsed and pulled" +2021,jerrod,177,greg,2021-03-31,,,,"3/10 collapsed and pulled" +2021,jerrod,177,greg,2021-04-07,,,,"3/10 collapsed and pulled" +2021,jerrod,177,greg,2021-04-15,,,,"3/10 collapsed and pulled" +2021,jerrod,177,greg,2021-04-21,,,,"3/10 collapsed and pulled" +2021,jerrod,177,greg,2021-04-26,,,,"3/10 collapsed and pulled" +2021,jerrod,192,greg,2021-03-03,3,,incubating,"3/31 drone flagged 4/7 drone flag removed" +2021,jerrod,192,greg,2021-03-10,0,,empty,"3/31 drone flagged 4/7 drone flag removed" +2021,jerrod,192,greg,2021-03-17,,,,"3/31 drone flagged 4/7 drone flag removed" +2021,jerrod,192,greg,2021-03-24,,,,"3/31 drone flagged 4/7 drone flag removed" +2021,jerrod,192,greg,2021-03-31,,,,"3/31 drone flagged 4/7 drone flag removed" +2021,jerrod,192,greg,2021-04-07,,,,"3/31 drone flagged 4/7 drone flag removed" +2021,jerrod,192,greg,2021-04-15,,,,"3/31 drone flagged 4/7 drone flag removed" +2021,jerrod,192,greg,2021-04-21,,,,"3/31 drone flagged 4/7 drone flag removed" +2021,jerrod,192,greg,2021-04-26,,,,"3/31 drone flagged 4/7 drone flag removed" +2021,jerrod,194,greg,2021-03-03,2,,incubating, +2021,jerrod,194,greg,2021-03-10,3,,incubating, +2021,jerrod,194,greg,2021-03-17,3,,incubating, +2021,jerrod,194,greg,2021-03-24,0,,empty, +2021,jerrod,194,greg,2021-03-31,,2,nestling, +2021,jerrod,194,greg,2021-04-07,,2,nestling, +2021,jerrod,194,greg,2021-04-15,,2,nestling, +2021,jerrod,194,greg,2021-04-21,,,missed, +2021,jerrod,194,greg,2021-04-26,0,0,empty, +2021,jerrod,179,gbhe,2021-03-03,2,,incubating,"3/31 ANHI flushed from empty nest, nest pulled" +2021,jerrod,179,gbhe,2021-03-10,0,,empty,"3/31 ANHI flushed from empty nest, nest pulled" +2021,jerrod,179,gbhe,2021-03-17,,,,"3/31 ANHI flushed from empty nest, nest pulled" +2021,jerrod,179,gbhe,2021-03-24,,,,"3/31 ANHI flushed from empty nest, nest pulled" +2021,jerrod,179,gbhe,2021-03-31,,,,"3/31 ANHI flushed from empty nest, nest pulled" +2021,jerrod,179,gbhe,2021-04-07,,,,"3/31 ANHI flushed from empty nest, nest pulled" +2021,jerrod,179,gbhe,2021-04-15,,,,"3/31 ANHI flushed from empty nest, nest pulled" +2021,jerrod,179,gbhe,2021-04-21,,,,"3/31 ANHI flushed from empty nest, nest pulled" +2021,jerrod,179,gbhe,2021-04-26,,,,"3/31 ANHI flushed from empty nest, nest pulled" +2021,jerrod,196,gbhe,2021-03-03,3,,incubating,"4/21 flagging pulled" +2021,jerrod,196,gbhe,2021-03-10,0,,empty,"4/21 flagging pulled" +2021,jerrod,196,gbhe,2021-03-17,,,,"4/21 flagging pulled" +2021,jerrod,196,gbhe,2021-03-24,,,,"4/21 flagging pulled" +2021,jerrod,196,gbhe,2021-03-31,,,,"4/21 flagging pulled" +2021,jerrod,196,gbhe,2021-04-07,,,,"4/21 flagging pulled" +2021,jerrod,196,gbhe,2021-04-15,,,,"4/21 flagging pulled" +2021,jerrod,196,gbhe,2021-04-21,,,,"4/21 flagging pulled" +2021,jerrod,196,gbhe,2021-04-26,,,,"4/21 flagging pulled" +2021,jerrod,181,greg,2021-03-03,1,,incubating, +2021,jerrod,181,greg,2021-03-10,2,,incubating, +2021,jerrod,181,greg,2021-03-17,2,,incubating, +2021,jerrod,181,greg,2021-03-24,2,,incubating, +2021,jerrod,181,greg,2021-03-31,1,1,pipping, +2021,jerrod,181,greg,2021-04-07,,2,nestling, +2021,jerrod,181,greg,2021-04-15,,2,nestling, +2021,jerrod,181,greg,2021-04-21,,2,nestling, +2021,jerrod,181,greg,2021-04-26,0,0,empty, +2021,jerrod,101,greg,2021-03-03,2,,incubating,"3/17 eggshell on ground 4/7 drone flagged" +2021,jerrod,101,greg,2021-03-10,0,,empty,"3/17 eggshell on ground 4/7 drone flagged" +2021,jerrod,101,greg,2021-03-17,,,,"3/17 eggshell on ground 4/7 drone flagged" +2021,jerrod,101,greg,2021-03-24,,,,"3/17 eggshell on ground 4/7 drone flagged" +2021,jerrod,101,greg,2021-03-31,,,,"3/17 eggshell on ground 4/7 drone flagged" +2021,jerrod,101,greg,2021-04-07,,,,"3/17 eggshell on ground 4/7 drone flagged" +2021,jerrod,101,greg,2021-04-15,,,,"3/17 eggshell on ground 4/7 drone flagged" +2021,jerrod,101,greg,2021-04-21,,,,"3/17 eggshell on ground 4/7 drone flagged" +2021,jerrod,101,greg,2021-04-26,,,,"3/17 eggshell on ground 4/7 drone flagged" +2021,jerrod,183,greg,2021-03-03,3,,incubating,"4/15 yellow drone flag" +2021,jerrod,183,greg,2021-03-10,0,,empty,"4/15 yellow drone flag" +2021,jerrod,183,greg,2021-03-17,,,,"4/15 yellow drone flag" +2021,jerrod,183,greg,2021-03-24,,,,"4/15 yellow drone flag" +2021,jerrod,183,greg,2021-03-31,,,,"4/15 yellow drone flag" +2021,jerrod,183,greg,2021-04-07,,,,"4/15 yellow drone flag" +2021,jerrod,183,greg,2021-04-15,,,,"4/15 yellow drone flag" +2021,jerrod,183,greg,2021-04-21,,,,"4/15 yellow drone flag" +2021,jerrod,183,greg,2021-04-26,,,,"4/15 yellow drone flag" +2021,jerrod,200,rsha,2021-03-03,1,,incubating,"4/15 1 egg gone, other egg dead" +2021,jerrod,200,rsha,2021-03-10,3,,incubating,"4/15 1 egg gone, other egg dead" +2021,jerrod,200,rsha,2021-03-17,3,,incubating,"4/15 1 egg gone, other egg dead" +2021,jerrod,200,rsha,2021-03-24,3,,incubating,"4/15 1 egg gone, other egg dead" +2021,jerrod,200,rsha,2021-03-31,3,,incubating,"4/15 1 egg gone, other egg dead" +2021,jerrod,200,rsha,2021-04-07,3,,incubating,"4/15 1 egg gone, other egg dead" +2021,jerrod,200,rsha,2021-04-15,1,1,hatching,"4/15 1 egg gone, other egg dead" +2021,jerrod,200,rsha,2021-04-21,1,1,hatching,"4/15 1 egg gone, other egg dead" +2021,jerrod,200,rsha,2021-04-26,1,,empty,"4/15 1 egg gone, other egg dead" +2021,jerrod,105,greg,2021-03-03,1,,incubating,"3/24 collapsed and pulled" +2021,jerrod,105,greg,2021-03-10,2,,incubating,"3/24 collapsed and pulled" +2021,jerrod,105,greg,2021-03-17,0,,empty,"3/24 collapsed and pulled" +2021,jerrod,105,greg,2021-03-24,,,,"3/24 collapsed and pulled" +2021,jerrod,105,greg,2021-03-31,,,,"3/24 collapsed and pulled" +2021,jerrod,105,greg,2021-04-07,,,,"3/24 collapsed and pulled" +2021,jerrod,105,greg,2021-04-15,,,,"3/24 collapsed and pulled" +2021,jerrod,105,greg,2021-04-21,,,,"3/24 collapsed and pulled" +2021,jerrod,105,greg,2021-04-26,,,,"3/24 collapsed and pulled" +2021,jerrod,185,greg,2021-03-03,2,,incubating,"3/17 egg pipping, 4/15 mercury" +2021,jerrod,185,greg,2021-03-10,2,,incubating,"3/17 egg pipping, 4/15 mercury" +2021,jerrod,185,greg,2021-03-17,1,1,wet_chick,"3/17 egg pipping, 4/15 mercury" +2021,jerrod,185,greg,2021-03-24,,1,nestling,"3/17 egg pipping, 4/15 mercury" +2021,jerrod,185,greg,2021-03-31,,1,nestling,"3/17 egg pipping, 4/15 mercury" +2021,jerrod,185,greg,2021-04-07,,1,nestling,"3/17 egg pipping, 4/15 mercury" +2021,jerrod,185,greg,2021-04-15,,1,nestling,"3/17 egg pipping, 4/15 mercury" +2021,jerrod,185,greg,2021-04-21,,1,nestling,"3/17 egg pipping, 4/15 mercury" +2021,jerrod,185,greg,2021-04-26,,,,"3/17 egg pipping, 4/15 mercury" +2021,jerrod,246,greg,2021-03-03,,,,"4/7 mercury" +2021,jerrod,246,greg,2021-03-10,3,,incubating,"4/7 mercury" +2021,jerrod,246,greg,2021-03-17,,3,nestling,"4/7 mercury" +2021,jerrod,246,greg,2021-03-24,,3,nestling,"4/7 mercury" +2021,jerrod,246,greg,2021-03-31,,2,nestling,"4/7 mercury" +2021,jerrod,246,greg,2021-04-07,,2,nestling,"4/7 mercury" +2021,jerrod,246,greg,2021-04-15,,2,nestling,"4/7 mercury" +2021,jerrod,246,greg,2021-04-21,,0,fledged,"4/7 mercury" +2021,jerrod,246,greg,2021-04-26,,,,"4/7 mercury" +2021,jerrod,311,greg,2021-03-03,,,, +2021,jerrod,311,greg,2021-03-10,3,,incubating, +2021,jerrod,311,greg,2021-03-17,1,2,wet_chick, +2021,jerrod,311,greg,2021-03-24,,3,nestling, +2021,jerrod,311,greg,2021-03-31,,3,nestling, +2021,jerrod,311,greg,2021-04-07,0,,empty, +2021,jerrod,311,greg,2021-04-15,,,, +2021,jerrod,311,greg,2021-04-21,,,, +2021,jerrod,311,greg,2021-04-26,,,, +2021,jerrod,500,gbhe,2021-03-03,,,,"4/21 1+ chick" +2021,jerrod,500,gbhe,2021-03-10,3,,incubating,"4/21 1+ chick" +2021,jerrod,500,gbhe,2021-03-17,,3,nestling,"4/21 1+ chick" +2021,jerrod,500,gbhe,2021-03-24,,2,nestling,"4/21 1+ chick" +2021,jerrod,500,gbhe,2021-03-31,,2,nestling,"4/21 1+ chick" +2021,jerrod,500,gbhe,2021-04-07,,2,nestling,"4/21 1+ chick" +2021,jerrod,500,gbhe,2021-04-15,,2,nestling,"4/21 1+ chick" +2021,jerrod,500,gbhe,2021-04-21,,1,nestling,"4/21 1+ chick" +2021,jerrod,500,gbhe,2021-04-26,,2,fledged,"4/21 1+ chick" +2021,cypress_city,202,greg,2021-03-04,3,,incubating,"4/16 mercury" +2021,cypress_city,202,greg,2021-03-11,3,,incubating,"4/16 mercury" +2021,cypress_city,202,greg,2021-03-18,3,,incubating,"4/16 mercury" +2021,cypress_city,202,greg,2021-03-25,,3,nestling,"4/16 mercury" +2021,cypress_city,202,greg,2021-04-01,,3,nestling,"4/16 mercury" +2021,cypress_city,202,greg,2021-04-08,,3,,"4/16 mercury" +2021,cypress_city,202,greg,2021-04-16,,3,,"4/16 mercury" +2021,cypress_city,202,greg,2021-04-22,0,0,fledged,"4/16 mercury" +2021,cypress_city,202,greg,2021-04-29,,,,"4/16 mercury" +2021,cypress_city,201,greg,2021-03-04,3,,incubating, +2021,cypress_city,201,greg,2021-03-11,3,,incubating, +2021,cypress_city,201,greg,2021-03-18,,2,nestling, +2021,cypress_city,201,greg,2021-03-25,,2,nestling, +2021,cypress_city,201,greg,2021-04-01,,2,nestling, +2021,cypress_city,201,greg,2021-04-08,,2,, +2021,cypress_city,201,greg,2021-04-16,,2,, +2021,cypress_city,201,greg,2021-04-22,0,0,fledged, +2021,cypress_city,201,greg,2021-04-29,,,, +2021,cypress_city,245,greg,2021-03-04,2,,incubating,"3/25 drone flag 4/1 drone flag removed, 4/16 mercury" +2021,cypress_city,245,greg,2021-03-11,3,,incubating,"3/25 drone flag 4/1 drone flag removed, 4/16 mercury" +2021,cypress_city,245,greg,2021-03-18,3,,incubating,"3/25 drone flag 4/1 drone flag removed, 4/16 mercury" +2021,cypress_city,245,greg,2021-03-25,3,,incubating,"3/25 drone flag 4/1 drone flag removed, 4/16 mercury" +2021,cypress_city,245,greg,2021-04-01,,3,nestling,"3/25 drone flag 4/1 drone flag removed, 4/16 mercury" +2021,cypress_city,245,greg,2021-04-08,,3,,"3/25 drone flag 4/1 drone flag removed, 4/16 mercury" +2021,cypress_city,245,greg,2021-04-16,,3,,"3/25 drone flag 4/1 drone flag removed, 4/16 mercury" +2021,cypress_city,245,greg,2021-04-22,,3,,"3/25 drone flag 4/1 drone flag removed, 4/16 mercury" +2021,cypress_city,245,greg,2021-04-29,,2,fledged,"3/25 drone flag 4/1 drone flag removed, 4/16 mercury" +2021,cypress_city,204,greg,2021-03-04,2,,incubating,"4/1 drone flagged 4/8 drone flag removed, 4/16 orange drone flag again?" +2021,cypress_city,204,greg,2021-03-11,3,,incubating,"4/1 drone flagged 4/8 drone flag removed, 4/16 orange drone flag again?" +2021,cypress_city,204,greg,2021-03-18,3,,incubating,"4/1 drone flagged 4/8 drone flag removed, 4/16 orange drone flag again?" +2021,cypress_city,204,greg,2021-03-25,1,2,hatching,"4/1 drone flagged 4/8 drone flag removed, 4/16 orange drone flag again?" +2021,cypress_city,204,greg,2021-04-01,1,2,hatching,"4/1 drone flagged 4/8 drone flag removed, 4/16 orange drone flag again?" +2021,cypress_city,204,greg,2021-04-08,1,2,,"4/1 drone flagged 4/8 drone flag removed, 4/16 orange drone flag again?" +2021,cypress_city,204,greg,2021-04-16,1,2,,"4/1 drone flagged 4/8 drone flag removed, 4/16 orange drone flag again?" +2021,cypress_city,204,greg,2021-04-22,0,0,empty,"4/1 drone flagged 4/8 drone flag removed, 4/16 orange drone flag again?" +2021,cypress_city,204,greg,2021-04-29,,,,"4/1 drone flagged 4/8 drone flag removed, 4/16 orange drone flag again?" +2021,cypress_city,247,greg,2021-03-04,3,,incubating,"3/11 Drone Flag 3/25 drone flag removed" +2021,cypress_city,247,greg,2021-03-11,3,,incubating,"3/11 Drone Flag 3/25 drone flag removed" +2021,cypress_city,247,greg,2021-03-18,0,,empty,"3/11 Drone Flag 3/25 drone flag removed" +2021,cypress_city,247,greg,2021-03-25,,,,"3/11 Drone Flag 3/25 drone flag removed" +2021,cypress_city,247,greg,2021-04-01,,,,"3/11 Drone Flag 3/25 drone flag removed" +2021,cypress_city,247,greg,2021-04-08,,,,"3/11 Drone Flag 3/25 drone flag removed" +2021,cypress_city,247,greg,2021-04-16,,,,"3/11 Drone Flag 3/25 drone flag removed" +2021,cypress_city,247,greg,2021-04-22,,,,"3/11 Drone Flag 3/25 drone flag removed" +2021,cypress_city,247,greg,2021-04-29,,,,"3/11 Drone Flag 3/25 drone flag removed" +2021,cypress_city,206,greg,2021-03-04,3,,incubating,"3/11 Drone Flag 3/25 drone flag removed, 4/16 possibly >2 chicks" +2021,cypress_city,206,greg,2021-03-11,3,,incubating,"3/11 Drone Flag 3/25 drone flag removed, 4/16 possibly >2 chicks" +2021,cypress_city,206,greg,2021-03-18,3,,incubating,"3/11 Drone Flag 3/25 drone flag removed, 4/16 possibly >2 chicks" +2021,cypress_city,206,greg,2021-03-25,,3,nestling,"3/11 Drone Flag 3/25 drone flag removed, 4/16 possibly >2 chicks" +2021,cypress_city,206,greg,2021-04-01,,3,nestling,"3/11 Drone Flag 3/25 drone flag removed, 4/16 possibly >2 chicks" +2021,cypress_city,206,greg,2021-04-08,,3,,"3/11 Drone Flag 3/25 drone flag removed, 4/16 possibly >2 chicks" +2021,cypress_city,206,greg,2021-04-16,,2,,"3/11 Drone Flag 3/25 drone flag removed, 4/16 possibly >2 chicks" +2021,cypress_city,206,greg,2021-04-22,0,0,fledged,"3/11 Drone Flag 3/25 drone flag removed, 4/16 possibly >2 chicks" +2021,cypress_city,206,greg,2021-04-29,,,,"3/11 Drone Flag 3/25 drone flag removed, 4/16 possibly >2 chicks" +2021,cypress_city,203,greg,2021-03-04,3,,incubating,"3/11 Drone Flag 3/25 drone flag removed, 4/16 mercury" +2021,cypress_city,203,greg,2021-03-11,3,,incubating,"3/11 Drone Flag 3/25 drone flag removed, 4/16 mercury" +2021,cypress_city,203,greg,2021-03-18,2,1,wet_chick,"3/11 Drone Flag 3/25 drone flag removed, 4/16 mercury" +2021,cypress_city,203,greg,2021-03-25,,3,nestling,"3/11 Drone Flag 3/25 drone flag removed, 4/16 mercury" +2021,cypress_city,203,greg,2021-04-01,,3,nestling,"3/11 Drone Flag 3/25 drone flag removed, 4/16 mercury" +2021,cypress_city,203,greg,2021-04-08,,3,,"3/11 Drone Flag 3/25 drone flag removed, 4/16 mercury" +2021,cypress_city,203,greg,2021-04-16,,3,,"3/11 Drone Flag 3/25 drone flag removed, 4/16 mercury" +2021,cypress_city,203,greg,2021-04-22,0,0,fledged,"3/11 Drone Flag 3/25 drone flag removed, 4/16 mercury" +2021,cypress_city,203,greg,2021-04-29,,,,"3/11 Drone Flag 3/25 drone flag removed, 4/16 mercury" +2021,cypress_city,208,greg,2021-03-04,1,,incubating,"3/25 drone flag 4/1 drone flag removed 4/8 mercury" +2021,cypress_city,208,greg,2021-03-11,3,,incubating,"3/25 drone flag 4/1 drone flag removed 4/8 mercury" +2021,cypress_city,208,greg,2021-03-18,3,,incubating,"3/25 drone flag 4/1 drone flag removed 4/8 mercury" +2021,cypress_city,208,greg,2021-03-25,3,,incubating,"3/25 drone flag 4/1 drone flag removed 4/8 mercury" +2021,cypress_city,208,greg,2021-04-01,1,2,hatching,"3/25 drone flag 4/1 drone flag removed 4/8 mercury" +2021,cypress_city,208,greg,2021-04-08,,3,,"3/25 drone flag 4/1 drone flag removed 4/8 mercury" +2021,cypress_city,208,greg,2021-04-16,,3,,"3/25 drone flag 4/1 drone flag removed 4/8 mercury" +2021,cypress_city,208,greg,2021-04-22,0,0,empty,"3/25 drone flag 4/1 drone flag removed 4/8 mercury" +2021,cypress_city,208,greg,2021-04-29,,,,"3/25 drone flag 4/1 drone flag removed 4/8 mercury" +2021,cypress_city,249,greg,2021-03-04,2,,incubating,"4/8 mercury" +2021,cypress_city,249,greg,2021-03-11,2,,incubating,"4/8 mercury" +2021,cypress_city,249,greg,2021-03-18,,2,nestling,"4/8 mercury" +2021,cypress_city,249,greg,2021-03-25,,2,nestling,"4/8 mercury" +2021,cypress_city,249,greg,2021-04-01,,2,nestling,"4/8 mercury" +2021,cypress_city,249,greg,2021-04-08,,2,,"4/8 mercury" +2021,cypress_city,249,greg,2021-04-16,,2,,"4/8 mercury" +2021,cypress_city,249,greg,2021-04-22,0,0,fledged,"4/8 mercury" +2021,cypress_city,249,greg,2021-04-29,,,,"4/8 mercury" +2021,cypress_city,205,greg,2021-03-04,2,,incubating, +2021,cypress_city,205,greg,2021-03-11,0,,empty, +2021,cypress_city,205,greg,2021-03-18,,,, +2021,cypress_city,205,greg,2021-03-25,,,, +2021,cypress_city,205,greg,2021-04-01,,,, +2021,cypress_city,205,greg,2021-04-08,,,, +2021,cypress_city,205,greg,2021-04-16,,,, +2021,cypress_city,205,greg,2021-04-22,,,, +2021,cypress_city,205,greg,2021-04-29,,,, +2021,cypress_city,210,greg,2021-03-04,3,,incubating, +2021,cypress_city,210,greg,2021-03-11,3,,incubating, +2021,cypress_city,210,greg,2021-03-18,,2,nestling, +2021,cypress_city,210,greg,2021-03-25,,3,nestling, +2021,cypress_city,210,greg,2021-04-01,,3,nestling, +2021,cypress_city,210,greg,2021-04-08,,3,, +2021,cypress_city,210,greg,2021-04-16,,2,, +2021,cypress_city,210,greg,2021-04-22,0,0,fledged, +2021,cypress_city,210,greg,2021-04-29,,,, +2021,cypress_city,212,greg,2021-03-04,1,,incubating, +2021,cypress_city,212,greg,2021-03-11,0,,empty, +2021,cypress_city,212,greg,2021-03-18,,,, +2021,cypress_city,212,greg,2021-03-25,,,, +2021,cypress_city,212,greg,2021-04-01,,,, +2021,cypress_city,212,greg,2021-04-08,,,, +2021,cypress_city,212,greg,2021-04-16,,,, +2021,cypress_city,212,greg,2021-04-22,,,, +2021,cypress_city,212,greg,2021-04-29,,,, +2021,cypress_city,207,greg,2021-03-04,3,,incubating,"3/11 Drone Flag 3/25 drone flag removed" +2021,cypress_city,207,greg,2021-03-11,3,,incubating,"3/11 Drone Flag 3/25 drone flag removed" +2021,cypress_city,207,greg,2021-03-18,2,1,pipping,"3/11 Drone Flag 3/25 drone flag removed" +2021,cypress_city,207,greg,2021-03-25,,3,nestling,"3/11 Drone Flag 3/25 drone flag removed" +2021,cypress_city,207,greg,2021-04-01,,3,nestling,"3/11 Drone Flag 3/25 drone flag removed" +2021,cypress_city,207,greg,2021-04-08,,0,empty,"3/11 Drone Flag 3/25 drone flag removed" +2021,cypress_city,207,greg,2021-04-16,,,,"3/11 Drone Flag 3/25 drone flag removed" +2021,cypress_city,207,greg,2021-04-22,,,,"3/11 Drone Flag 3/25 drone flag removed" +2021,cypress_city,207,greg,2021-04-29,,,,"3/11 Drone Flag 3/25 drone flag removed" +2021,cypress_city,211,rosp,2021-03-04,1,,incubating,"3/11 2 ROSP eggs on the ground below nest" +2021,cypress_city,211,rosp,2021-03-11,2,,incubating,"3/11 2 ROSP eggs on the ground below nest" +2021,cypress_city,211,rosp,2021-03-18,2,,incubating,"3/11 2 ROSP eggs on the ground below nest" +2021,cypress_city,211,rosp,2021-03-25,2,,incubating,"3/11 2 ROSP eggs on the ground below nest" +2021,cypress_city,211,rosp,2021-04-01,,2,nestling,"3/11 2 ROSP eggs on the ground below nest" +2021,cypress_city,211,rosp,2021-04-08,,2,,"3/11 2 ROSP eggs on the ground below nest" +2021,cypress_city,211,rosp,2021-04-16,,2,,"3/11 2 ROSP eggs on the ground below nest" +2021,cypress_city,211,rosp,2021-04-22,,2,,"3/11 2 ROSP eggs on the ground below nest" +2021,cypress_city,211,rosp,2021-04-29,,2,fledged,"3/11 2 ROSP eggs on the ground below nest" +2021,cypress_city,216,greg,2021-03-04,2,,incubating, +2021,cypress_city,216,greg,2021-03-11,2,,incubating, +2021,cypress_city,216,greg,2021-03-18,0,,empty, +2021,cypress_city,216,greg,2021-03-25,,,, +2021,cypress_city,216,greg,2021-04-01,,,, +2021,cypress_city,216,greg,2021-04-08,,,, +2021,cypress_city,216,greg,2021-04-16,,,, +2021,cypress_city,216,greg,2021-04-22,,,, +2021,cypress_city,216,greg,2021-04-29,,,, +2021,cypress_city,214,bcnh,2021-03-04,1,,incubating,"4/1 drone flagged" +2021,cypress_city,214,bcnh,2021-03-11,2,,incubating,"4/1 drone flagged" +2021,cypress_city,214,bcnh,2021-03-18,2,,incubating,"4/1 drone flagged" +2021,cypress_city,214,bcnh,2021-03-25,2,,incubating,"4/1 drone flagged" +2021,cypress_city,214,bcnh,2021-04-01,0,,empty,"4/1 drone flagged" +2021,cypress_city,214,bcnh,2021-04-08,,,,"4/1 drone flagged" +2021,cypress_city,214,bcnh,2021-04-16,,,,"4/1 drone flagged" +2021,cypress_city,214,bcnh,2021-04-22,,,,"4/1 drone flagged" +2021,cypress_city,214,bcnh,2021-04-29,,,,"4/1 drone flagged" +2021,cypress_city,218,greg,2021-03-04,2,,incubating, +2021,cypress_city,218,greg,2021-03-11,2,,incubating, +2021,cypress_city,218,greg,2021-03-18,0,,empty, +2021,cypress_city,218,greg,2021-03-25,,,, +2021,cypress_city,218,greg,2021-04-01,,,, +2021,cypress_city,218,greg,2021-04-08,,,, +2021,cypress_city,218,greg,2021-04-16,,,, +2021,cypress_city,218,greg,2021-04-22,,,, +2021,cypress_city,218,greg,2021-04-29,,,, +2021,cypress_city,251,greg,2021-03-04,2,,incubating, +2021,cypress_city,251,greg,2021-03-11,3,,incubating, +2021,cypress_city,251,greg,2021-03-18,2,,incubating, +2021,cypress_city,251,greg,2021-03-25,,2,nestling, +2021,cypress_city,251,greg,2021-04-01,,2,nestling, +2021,cypress_city,251,greg,2021-04-08,,2,, +2021,cypress_city,251,greg,2021-04-16,,2,, +2021,cypress_city,251,greg,2021-04-22,0,0,fledged, +2021,cypress_city,251,greg,2021-04-29,,,, +2021,cypress_city,220,greg,2021-03-04,3,,incubating,"4/8 mercury, 4/16 probably more chicks fledged" +2021,cypress_city,220,greg,2021-03-11,1,2,wet_chick,"4/8 mercury, 4/16 probably more chicks fledged" +2021,cypress_city,220,greg,2021-03-18,,3,nestling,"4/8 mercury, 4/16 probably more chicks fledged" +2021,cypress_city,220,greg,2021-03-25,,3,nestling,"4/8 mercury, 4/16 probably more chicks fledged" +2021,cypress_city,220,greg,2021-04-01,,3,nestling,"4/8 mercury, 4/16 probably more chicks fledged" +2021,cypress_city,220,greg,2021-04-08,,3,,"4/8 mercury, 4/16 probably more chicks fledged" +2021,cypress_city,220,greg,2021-04-16,,1,,"4/8 mercury, 4/16 probably more chicks fledged" +2021,cypress_city,220,greg,2021-04-22,0,0,fledged,"4/8 mercury, 4/16 probably more chicks fledged" +2021,cypress_city,220,greg,2021-04-29,,,,"4/8 mercury, 4/16 probably more chicks fledged" +2021,cypress_city,253,greg,2021-03-04,3,,incubating, +2021,cypress_city,253,greg,2021-03-11,3,,incubating, +2021,cypress_city,253,greg,2021-03-18,3,,incubating, +2021,cypress_city,253,greg,2021-03-25,1,2,hatching, +2021,cypress_city,253,greg,2021-04-01,,3,nestling, +2021,cypress_city,253,greg,2021-04-08,,3,, +2021,cypress_city,253,greg,2021-04-16,,3,, +2021,cypress_city,253,greg,2021-04-22,,3,, +2021,cypress_city,253,greg,2021-04-29,,,, +2021,cypress_city,255,greg,2021-03-04,3,,incubating,"4/8 mercury, 4/16 probably fledged" +2021,cypress_city,255,greg,2021-03-11,3,,incubating,"4/8 mercury, 4/16 probably fledged" +2021,cypress_city,255,greg,2021-03-18,2,1,pipping,"4/8 mercury, 4/16 probably fledged" +2021,cypress_city,255,greg,2021-03-25,,2,nestling,"4/8 mercury, 4/16 probably fledged" +2021,cypress_city,255,greg,2021-04-01,,2,nestling,"4/8 mercury, 4/16 probably fledged" +2021,cypress_city,255,greg,2021-04-08,,2,,"4/8 mercury, 4/16 probably fledged" +2021,cypress_city,255,greg,2021-04-16,,0,empty,"4/8 mercury, 4/16 probably fledged" +2021,cypress_city,255,greg,2021-04-22,,,,"4/8 mercury, 4/16 probably fledged" +2021,cypress_city,255,greg,2021-04-29,,,,"4/8 mercury, 4/16 probably fledged" +2021,cypress_city,257,greg,2021-03-04,3,,incubating,"3/11 drone Flag 3/25 drone flag removed 4/8 mercury" +2021,cypress_city,257,greg,2021-03-11,2,1,hatching,"3/11 drone Flag 3/25 drone flag removed 4/8 mercury" +2021,cypress_city,257,greg,2021-03-18,,3,nestling,"3/11 drone Flag 3/25 drone flag removed 4/8 mercury" +2021,cypress_city,257,greg,2021-03-25,,3,nestling,"3/11 drone Flag 3/25 drone flag removed 4/8 mercury" +2021,cypress_city,257,greg,2021-04-01,,3,nestling,"3/11 drone Flag 3/25 drone flag removed 4/8 mercury" +2021,cypress_city,257,greg,2021-04-08,,3,,"3/11 drone Flag 3/25 drone flag removed 4/8 mercury" +2021,cypress_city,257,greg,2021-04-16,,1,,"3/11 drone Flag 3/25 drone flag removed 4/8 mercury" +2021,cypress_city,257,greg,2021-04-22,0,0,fledged,"3/11 drone Flag 3/25 drone flag removed 4/8 mercury" +2021,cypress_city,257,greg,2021-04-29,,,,"3/11 drone Flag 3/25 drone flag removed 4/8 mercury" +2021,cypress_city,259,greg,2021-03-04,3,,incubating,"3/11 Drone Flag, before 261 3/25 drone flag removed, 4/16 mercury" +2021,cypress_city,259,greg,2021-03-11,3,,incubating,"3/11 Drone Flag, before 261 3/25 drone flag removed, 4/16 mercury" +2021,cypress_city,259,greg,2021-03-18,2,1,wet_chick,"3/11 Drone Flag, before 261 3/25 drone flag removed, 4/16 mercury" +2021,cypress_city,259,greg,2021-03-25,1,2,hatching,"3/11 Drone Flag, before 261 3/25 drone flag removed, 4/16 mercury" +2021,cypress_city,259,greg,2021-04-01,1,2,hatching,"3/11 Drone Flag, before 261 3/25 drone flag removed, 4/16 mercury" +2021,cypress_city,259,greg,2021-04-08,1,2,,"3/11 Drone Flag, before 261 3/25 drone flag removed, 4/16 mercury" +2021,cypress_city,259,greg,2021-04-16,,2,,"3/11 Drone Flag, before 261 3/25 drone flag removed, 4/16 mercury" +2021,cypress_city,259,greg,2021-04-22,0,0,fledged,"3/11 Drone Flag, before 261 3/25 drone flag removed, 4/16 mercury" +2021,cypress_city,259,greg,2021-04-29,,,,"3/11 Drone Flag, before 261 3/25 drone flag removed, 4/16 mercury" +2021,cypress_city,261,greg,2021-03-04,2,,incubating,"3/11 Drone Flag. Old flag not seen on 3/25, new drone flag placed" +2021,cypress_city,261,greg,2021-03-11,2,,incubating,"3/11 Drone Flag. Old flag not seen on 3/25, new drone flag placed" +2021,cypress_city,261,greg,2021-03-18,2,,incubating,"3/11 Drone Flag. Old flag not seen on 3/25, new drone flag placed" +2021,cypress_city,261,greg,2021-03-25,2,,incubating,"3/11 Drone Flag. Old flag not seen on 3/25, new drone flag placed" +2021,cypress_city,261,greg,2021-04-01,,2,wet_chick,"3/11 Drone Flag. Old flag not seen on 3/25, new drone flag placed" +2021,cypress_city,261,greg,2021-04-08,,2,,"3/11 Drone Flag. Old flag not seen on 3/25, new drone flag placed" +2021,cypress_city,261,greg,2021-04-16,,2,,"3/11 Drone Flag. Old flag not seen on 3/25, new drone flag placed" +2021,cypress_city,261,greg,2021-04-22,,2,,"3/11 Drone Flag. Old flag not seen on 3/25, new drone flag placed" +2021,cypress_city,261,greg,2021-04-29,,2,fledged,"3/11 Drone Flag. Old flag not seen on 3/25, new drone flag placed" +2021,cypress_city,213,greg,2021-03-04,1,,incubating,"3/25 drone flag 4/1 drone flag removed 4/29 2+ chicks" +2021,cypress_city,213,greg,2021-03-11,3,,incubating,"3/25 drone flag 4/1 drone flag removed 4/29 2+ chicks" +2021,cypress_city,213,greg,2021-03-18,3,,incubating,"3/25 drone flag 4/1 drone flag removed 4/29 2+ chicks" +2021,cypress_city,213,greg,2021-03-25,3,,incubating,"3/25 drone flag 4/1 drone flag removed 4/29 2+ chicks" +2021,cypress_city,213,greg,2021-04-01,1,2,hatching,"3/25 drone flag 4/1 drone flag removed 4/29 2+ chicks" +2021,cypress_city,213,greg,2021-04-08,,3,,"3/25 drone flag 4/1 drone flag removed 4/29 2+ chicks" +2021,cypress_city,213,greg,2021-04-16,,3,,"3/25 drone flag 4/1 drone flag removed 4/29 2+ chicks" +2021,cypress_city,213,greg,2021-04-22,,3,,"3/25 drone flag 4/1 drone flag removed 4/29 2+ chicks" +2021,cypress_city,213,greg,2021-04-29,,2,fledged,"3/25 drone flag 4/1 drone flag removed 4/29 2+ chicks" +2021,cypress_city,222,gbhe,2021-03-04,2,,incubating, +2021,cypress_city,222,gbhe,2021-03-11,1,1,hatching, +2021,cypress_city,222,gbhe,2021-03-18,,2,nestling, +2021,cypress_city,222,gbhe,2021-03-25,,2,nestling, +2021,cypress_city,222,gbhe,2021-04-01,,2,nestling, +2021,cypress_city,222,gbhe,2021-04-08,,2,, +2021,cypress_city,222,gbhe,2021-04-16,,2,, +2021,cypress_city,222,gbhe,2021-04-22,,2,, +2021,cypress_city,222,gbhe,2021-04-29,,,, +2021,cypress_city,215,rosp,2021-03-04,1,,incubating, +2021,cypress_city,215,rosp,2021-03-11,4,,incubating, +2021,cypress_city,215,rosp,2021-03-18,4,,incubating, +2021,cypress_city,215,rosp,2021-03-25,4,,incubating, +2021,cypress_city,215,rosp,2021-04-01,1,3,hatching, +2021,cypress_city,215,rosp,2021-04-08,,4,, +2021,cypress_city,215,rosp,2021-04-16,,4,, +2021,cypress_city,215,rosp,2021-04-22,,3,, +2021,cypress_city,215,rosp,2021-04-29,,3,fledged, +2021,cypress_city,263,greg,2021-03-04,3,,incubating,"4/16 yellow drone flag?" +2021,cypress_city,263,greg,2021-03-11,3,,incubating,"4/16 yellow drone flag?" +2021,cypress_city,263,greg,2021-03-18,0,,empty,"4/16 yellow drone flag?" +2021,cypress_city,263,greg,2021-03-25,,,,"4/16 yellow drone flag?" +2021,cypress_city,263,greg,2021-04-01,,,,"4/16 yellow drone flag?" +2021,cypress_city,263,greg,2021-04-08,,,,"4/16 yellow drone flag?" +2021,cypress_city,263,greg,2021-04-16,,,,"4/16 yellow drone flag?" +2021,cypress_city,263,greg,2021-04-22,,,,"4/16 yellow drone flag?" +2021,cypress_city,263,greg,2021-04-29,,,,"4/16 yellow drone flag?" +2021,cypress_city,224,greg,2021-03-04,2,,incubating, +2021,cypress_city,224,greg,2021-03-11,0,,empty, +2021,cypress_city,224,greg,2021-03-18,,,, +2021,cypress_city,224,greg,2021-03-25,,,, +2021,cypress_city,224,greg,2021-04-01,,,, +2021,cypress_city,224,greg,2021-04-08,,,, +2021,cypress_city,224,greg,2021-04-16,,,, +2021,cypress_city,224,greg,2021-04-22,,,, +2021,cypress_city,224,greg,2021-04-29,,,, +2021,cypress_city,277,greg,2021-03-04,3,,incubating,"4/1 drone flagged 4/8 drone flag removed" +2021,cypress_city,277,greg,2021-03-11,3,,incubating,"4/1 drone flagged 4/8 drone flag removed" +2021,cypress_city,277,greg,2021-03-18,3,,incubating,"4/1 drone flagged 4/8 drone flag removed" +2021,cypress_city,277,greg,2021-03-25,,3,nestling,"4/1 drone flagged 4/8 drone flag removed" +2021,cypress_city,277,greg,2021-04-01,,3,nestling,"4/1 drone flagged 4/8 drone flag removed" +2021,cypress_city,277,greg,2021-04-08,,3,,"4/1 drone flagged 4/8 drone flag removed" +2021,cypress_city,277,greg,2021-04-16,,2,,"4/1 drone flagged 4/8 drone flag removed" +2021,cypress_city,277,greg,2021-04-22,,2,,"4/1 drone flagged 4/8 drone flag removed" +2021,cypress_city,277,greg,2021-04-29,,,,"4/1 drone flagged 4/8 drone flag removed" +2021,cypress_city,265,greg,2021-03-04,2,,incubating,"4/1 drone flagged 4/8 drone flag removed" +2021,cypress_city,265,greg,2021-03-11,2,,incubating,"4/1 drone flagged 4/8 drone flag removed" +2021,cypress_city,265,greg,2021-03-18,,2,nestling,"4/1 drone flagged 4/8 drone flag removed" +2021,cypress_city,265,greg,2021-03-25,,2,nestling,"4/1 drone flagged 4/8 drone flag removed" +2021,cypress_city,265,greg,2021-04-01,,2,nestling,"4/1 drone flagged 4/8 drone flag removed" +2021,cypress_city,265,greg,2021-04-08,,2,,"4/1 drone flagged 4/8 drone flag removed" +2021,cypress_city,265,greg,2021-04-16,,2,,"4/1 drone flagged 4/8 drone flag removed" +2021,cypress_city,265,greg,2021-04-22,0,0,fledged,"4/1 drone flagged 4/8 drone flag removed" +2021,cypress_city,265,greg,2021-04-29,,,,"4/1 drone flagged 4/8 drone flag removed" +2021,cypress_city,226,greg,2021-03-04,3,,incubating,"4/1 drone flagged" +2021,cypress_city,226,greg,2021-03-11,3,,incubating,"4/1 drone flagged" +2021,cypress_city,226,greg,2021-03-18,3,,incubating,"4/1 drone flagged" +2021,cypress_city,226,greg,2021-03-25,2,1,wet_chick,"4/1 drone flagged" +2021,cypress_city,226,greg,2021-04-01,,3,nestling,"4/1 drone flagged" +2021,cypress_city,226,greg,2021-04-08,,3,,"4/1 drone flagged" +2021,cypress_city,226,greg,2021-04-16,,3,,"4/1 drone flagged" +2021,cypress_city,226,greg,2021-04-22,,3,,"4/1 drone flagged" +2021,cypress_city,226,greg,2021-04-29,,,,"4/1 drone flagged" +2021,cypress_city,279,greg,2021-03-04,3,,incubating,"3/11 Drone Flag 3/25 drone flag removed 4/8 dead chick below nestcup" +2021,cypress_city,279,greg,2021-03-11,3,,incubating,"3/11 Drone Flag 3/25 drone flag removed 4/8 dead chick below nestcup" +2021,cypress_city,279,greg,2021-03-18,3,,incubating,"3/11 Drone Flag 3/25 drone flag removed 4/8 dead chick below nestcup" +2021,cypress_city,279,greg,2021-03-25,1,2,hatching,"3/11 Drone Flag 3/25 drone flag removed 4/8 dead chick below nestcup" +2021,cypress_city,279,greg,2021-04-01,,3,nestling,"3/11 Drone Flag 3/25 drone flag removed 4/8 dead chick below nestcup" +2021,cypress_city,279,greg,2021-04-08,,2,,"3/11 Drone Flag 3/25 drone flag removed 4/8 dead chick below nestcup" +2021,cypress_city,279,greg,2021-04-16,,2,,"3/11 Drone Flag 3/25 drone flag removed 4/8 dead chick below nestcup" +2021,cypress_city,279,greg,2021-04-22,,2,,"3/11 Drone Flag 3/25 drone flag removed 4/8 dead chick below nestcup" +2021,cypress_city,279,greg,2021-04-29,,,,"3/11 Drone Flag 3/25 drone flag removed 4/8 dead chick below nestcup" +2021,cypress_city,281,greg,2021-03-04,3,,incubating,"3/11 Drone Flag in order after 279 3/25 drone flag removed" +2021,cypress_city,281,greg,2021-03-11,3,,incubating,"3/11 Drone Flag in order after 279 3/25 drone flag removed" +2021,cypress_city,281,greg,2021-03-18,3,,incubating,"3/11 Drone Flag in order after 279 3/25 drone flag removed" +2021,cypress_city,281,greg,2021-03-25,3,,incubating,"3/11 Drone Flag in order after 279 3/25 drone flag removed" +2021,cypress_city,281,greg,2021-04-01,,3,nestling,"3/11 Drone Flag in order after 279 3/25 drone flag removed" +2021,cypress_city,281,greg,2021-04-08,,3,,"3/11 Drone Flag in order after 279 3/25 drone flag removed" +2021,cypress_city,281,greg,2021-04-16,,3,,"3/11 Drone Flag in order after 279 3/25 drone flag removed" +2021,cypress_city,281,greg,2021-04-22,,3,,"3/11 Drone Flag in order after 279 3/25 drone flag removed" +2021,cypress_city,281,greg,2021-04-29,,,,"3/11 Drone Flag in order after 279 3/25 drone flag removed" +2021,cypress_city,228,greg,2021-03-04,3,,incubating,"4/16 mercury" +2021,cypress_city,228,greg,2021-03-11,3,,incubating,"4/16 mercury" +2021,cypress_city,228,greg,2021-03-18,3,,incubating,"4/16 mercury" +2021,cypress_city,228,greg,2021-03-25,1,2,pipping,"4/16 mercury" +2021,cypress_city,228,greg,2021-04-01,,3,nestling,"4/16 mercury" +2021,cypress_city,228,greg,2021-04-08,,3,,"4/16 mercury" +2021,cypress_city,228,greg,2021-04-16,,3,,"4/16 mercury" +2021,cypress_city,228,greg,2021-04-22,,3,,"4/16 mercury" +2021,cypress_city,228,greg,2021-04-29,,,,"4/16 mercury" +2021,cypress_city,230,rosp,2021-03-04,2,,incubating,"4/1 drone flag between 230 and 232, closer to 232, 4/16 plus one dead chick" +2021,cypress_city,230,rosp,2021-03-11,4,,incubating,"4/1 drone flag between 230 and 232, closer to 232, 4/16 plus one dead chick" +2021,cypress_city,230,rosp,2021-03-18,4,,incubating,"4/1 drone flag between 230 and 232, closer to 232, 4/16 plus one dead chick" +2021,cypress_city,230,rosp,2021-03-25,4,,incubating,"4/1 drone flag between 230 and 232, closer to 232, 4/16 plus one dead chick" +2021,cypress_city,230,rosp,2021-04-01,,4,nestling,"4/1 drone flag between 230 and 232, closer to 232, 4/16 plus one dead chick" +2021,cypress_city,230,rosp,2021-04-08,,4,,"4/1 drone flag between 230 and 232, closer to 232, 4/16 plus one dead chick" +2021,cypress_city,230,rosp,2021-04-16,,2,,"4/1 drone flag between 230 and 232, closer to 232, 4/16 plus one dead chick" +2021,cypress_city,230,rosp,2021-04-22,,2,,"4/1 drone flag between 230 and 232, closer to 232, 4/16 plus one dead chick" +2021,cypress_city,230,rosp,2021-04-29,,2,fledged,"4/1 drone flag between 230 and 232, closer to 232, 4/16 plus one dead chick" +2021,cypress_city,232,greg,2021-03-04,3,,incubating,"4/1 drone flag between 230 and 232, closer to 232" +2021,cypress_city,232,greg,2021-03-11,3,,incubating,"4/1 drone flag between 230 and 232, closer to 232" +2021,cypress_city,232,greg,2021-03-18,3,,incubating,"4/1 drone flag between 230 and 232, closer to 232" +2021,cypress_city,232,greg,2021-03-25,,3,nestling,"4/1 drone flag between 230 and 232, closer to 232" +2021,cypress_city,232,greg,2021-04-01,,3,nestling,"4/1 drone flag between 230 and 232, closer to 232" +2021,cypress_city,232,greg,2021-04-08,,3,,"4/1 drone flag between 230 and 232, closer to 232" +2021,cypress_city,232,greg,2021-04-16,,3,,"4/1 drone flag between 230 and 232, closer to 232" +2021,cypress_city,232,greg,2021-04-22,,3,,"4/1 drone flag between 230 and 232, closer to 232" +2021,cypress_city,232,greg,2021-04-29,,,,"4/1 drone flag between 230 and 232, closer to 232" +2021,cypress_city,267,greg,2021-03-04,3,,incubating, +2021,cypress_city,267,greg,2021-03-11,3,,incubating, +2021,cypress_city,267,greg,2021-03-18,0,,empty, +2021,cypress_city,267,greg,2021-03-25,,,, +2021,cypress_city,267,greg,2021-04-01,,,, +2021,cypress_city,267,greg,2021-04-08,,,, +2021,cypress_city,267,greg,2021-04-16,,,, +2021,cypress_city,267,greg,2021-04-22,,,, +2021,cypress_city,267,greg,2021-04-29,,,, +2021,cypress_city,283,greg,2021-03-04,2,,incubating, +2021,cypress_city,283,greg,2021-03-11,2,,incubating, +2021,cypress_city,283,greg,2021-03-18,2,,incubating, +2021,cypress_city,283,greg,2021-03-25,2,,incubating, +2021,cypress_city,283,greg,2021-04-01,,2,nestling, +2021,cypress_city,283,greg,2021-04-08,,2,, +2021,cypress_city,283,greg,2021-04-16,,2,, +2021,cypress_city,283,greg,2021-04-22,,2,, +2021,cypress_city,283,greg,2021-04-29,,,, +2021,cypress_city,269,rosp,2021-03-04,2,,incubating, +2021,cypress_city,269,rosp,2021-03-11,4,,incubating, +2021,cypress_city,269,rosp,2021-03-18,4,,incubating, +2021,cypress_city,269,rosp,2021-03-25,4,,incubating, +2021,cypress_city,269,rosp,2021-04-01,,4,nestling, +2021,cypress_city,269,rosp,2021-04-08,,4,, +2021,cypress_city,269,rosp,2021-04-16,,0,empty, +2021,cypress_city,269,rosp,2021-04-22,,,, +2021,cypress_city,269,rosp,2021-04-29,,,, +2021,cypress_city,234,greg,2021-03-04,3,,incubating, +2021,cypress_city,234,greg,2021-03-11,3,,incubating, +2021,cypress_city,234,greg,2021-03-18,,3,wet_chick, +2021,cypress_city,234,greg,2021-03-25,,3,nestling, +2021,cypress_city,234,greg,2021-04-01,,3,nestling, +2021,cypress_city,234,greg,2021-04-08,,3,, +2021,cypress_city,234,greg,2021-04-16,,2,, +2021,cypress_city,234,greg,2021-04-22,0,0,fledged, +2021,cypress_city,234,greg,2021-04-29,,,, +2021,cypress_city,285,rosp,2021-03-04,3,,incubating,"4/16 yellow drone flag" +2021,cypress_city,285,rosp,2021-03-11,4,,incubating,"4/16 yellow drone flag" +2021,cypress_city,285,rosp,2021-03-18,4,,incubating,"4/16 yellow drone flag" +2021,cypress_city,285,rosp,2021-03-25,2,2,hatching,"4/16 yellow drone flag" +2021,cypress_city,285,rosp,2021-04-01,,3,nestling,"4/16 yellow drone flag" +2021,cypress_city,285,rosp,2021-04-08,,3,,"4/16 yellow drone flag" +2021,cypress_city,285,rosp,2021-04-16,,0,empty,"4/16 yellow drone flag" +2021,cypress_city,285,rosp,2021-04-22,,,,"4/16 yellow drone flag" +2021,cypress_city,285,rosp,2021-04-29,,,,"4/16 yellow drone flag" +2021,cypress_city,236,greg,2021-03-04,1,,incubating,"3/25 drone flag 4/1 drone flag removed" +2021,cypress_city,236,greg,2021-03-11,1,,incubating,"3/25 drone flag 4/1 drone flag removed" +2021,cypress_city,236,greg,2021-03-18,,1,wet_chick,"3/25 drone flag 4/1 drone flag removed" +2021,cypress_city,236,greg,2021-03-25,,1,nestling,"3/25 drone flag 4/1 drone flag removed" +2021,cypress_city,236,greg,2021-04-01,,1,nestling,"3/25 drone flag 4/1 drone flag removed" +2021,cypress_city,236,greg,2021-04-08,,1,,"3/25 drone flag 4/1 drone flag removed" +2021,cypress_city,236,greg,2021-04-16,,1,,"3/25 drone flag 4/1 drone flag removed" +2021,cypress_city,236,greg,2021-04-22,0,0,fledged,"3/25 drone flag 4/1 drone flag removed" +2021,cypress_city,236,greg,2021-04-29,,,,"3/25 drone flag 4/1 drone flag removed" +2021,cypress_city,240,greg,2021-03-04,1,,incubating,"4/8 blue flag placed in nestcup--surrounded by cattails" +2021,cypress_city,240,greg,2021-03-11,0,,empty,"4/8 blue flag placed in nestcup--surrounded by cattails" +2021,cypress_city,240,greg,2021-03-18,,,,"4/8 blue flag placed in nestcup--surrounded by cattails" +2021,cypress_city,240,greg,2021-03-25,,,,"4/8 blue flag placed in nestcup--surrounded by cattails" +2021,cypress_city,240,greg,2021-04-01,,,,"4/8 blue flag placed in nestcup--surrounded by cattails" +2021,cypress_city,240,greg,2021-04-08,,,,"4/8 blue flag placed in nestcup--surrounded by cattails" +2021,cypress_city,240,greg,2021-04-16,,,,"4/8 blue flag placed in nestcup--surrounded by cattails" +2021,cypress_city,240,greg,2021-04-22,,,,"4/8 blue flag placed in nestcup--surrounded by cattails" +2021,cypress_city,240,greg,2021-04-29,,,,"4/8 blue flag placed in nestcup--surrounded by cattails" +2021,cypress_city,271,greg,2021-03-04,3,,incubating, +2021,cypress_city,271,greg,2021-03-11,3,,incubating, +2021,cypress_city,271,greg,2021-03-18,3,,incubating, +2021,cypress_city,271,greg,2021-03-25,,,missed, +2021,cypress_city,271,greg,2021-04-01,,3,nestling, +2021,cypress_city,271,greg,2021-04-08,,3,, +2021,cypress_city,271,greg,2021-04-16,,3,, +2021,cypress_city,271,greg,2021-04-22,,3,, +2021,cypress_city,271,greg,2021-04-29,,,, +2021,cypress_city,287,greg,2021-03-04,0,0,pre_flagged, +2021,cypress_city,287,greg,2021-03-11,1,,incubating, +2021,cypress_city,287,greg,2021-03-18,,,missed, +2021,cypress_city,287,greg,2021-03-25,,,missed, +2021,cypress_city,287,greg,2021-04-01,,0,empty, +2021,cypress_city,287,greg,2021-04-08,,,, +2021,cypress_city,287,greg,2021-04-16,,,, +2021,cypress_city,287,greg,2021-04-22,,,, +2021,cypress_city,287,greg,2021-04-29,,,, +2021,cypress_city,242,greg,2021-03-04,3,,incubating,"4/8 mercury" +2021,cypress_city,242,greg,2021-03-11,3,,incubating,"4/8 mercury" +2021,cypress_city,242,greg,2021-03-18,2,1,pipping,"4/8 mercury" +2021,cypress_city,242,greg,2021-03-25,,3,nestling,"4/8 mercury" +2021,cypress_city,242,greg,2021-04-01,,3,nestling,"4/8 mercury" +2021,cypress_city,242,greg,2021-04-08,,3,,"4/8 mercury" +2021,cypress_city,242,greg,2021-04-16,,3,,"4/8 mercury" +2021,cypress_city,242,greg,2021-04-22,,3,,"4/8 mercury" +2021,cypress_city,242,greg,2021-04-29,,,,"4/8 mercury" +2021,cypress_city,273,greg,2021-03-04,3,,incubating,"4/16 yellow drone flag" +2021,cypress_city,273,greg,2021-03-11,3,,incubating,"4/16 yellow drone flag" +2021,cypress_city,273,greg,2021-03-18,0,,empty,"4/16 yellow drone flag" +2021,cypress_city,273,greg,2021-03-25,,,,"4/16 yellow drone flag" +2021,cypress_city,273,greg,2021-04-01,,,,"4/16 yellow drone flag" +2021,cypress_city,273,greg,2021-04-08,,,,"4/16 yellow drone flag" +2021,cypress_city,273,greg,2021-04-16,,,,"4/16 yellow drone flag" +2021,cypress_city,273,greg,2021-04-22,,,,"4/16 yellow drone flag" +2021,cypress_city,273,greg,2021-04-29,,,,"4/16 yellow drone flag" +2021,cypress_city,289,greg,2021-03-04,3,,incubating, +2021,cypress_city,289,greg,2021-03-11,4,,incubating, +2021,cypress_city,289,greg,2021-03-18,4,,incubating, +2021,cypress_city,289,greg,2021-03-25,2,2,pipping, +2021,cypress_city,289,greg,2021-04-01,,3,nestling, +2021,cypress_city,289,greg,2021-04-08,,3,, +2021,cypress_city,289,greg,2021-04-16,,3,, +2021,cypress_city,289,greg,2021-04-22,,3,, +2021,cypress_city,289,greg,2021-04-29,,,, +2021,cypress_city,431,rosp,2021-03-04,,,, +2021,cypress_city,431,rosp,2021-03-11,3,,incubating, +2021,cypress_city,431,rosp,2021-03-18,4,,incubating, +2021,cypress_city,431,rosp,2021-03-25,4,,incubating, +2021,cypress_city,431,rosp,2021-04-01,1,3,wet_chick, +2021,cypress_city,431,rosp,2021-04-08,,4,, +2021,cypress_city,431,rosp,2021-04-16,,3,, +2021,cypress_city,431,rosp,2021-04-22,,2,, +2021,cypress_city,431,rosp,2021-04-29,,2,fledged, +2021,cypress_city,433,gbhe,2021-03-04,,,, +2021,cypress_city,433,gbhe,2021-03-11,3,,pipping, +2021,cypress_city,433,gbhe,2021-03-18,,3,nestling, +2021,cypress_city,433,gbhe,2021-03-25,,3,nestling, +2021,cypress_city,433,gbhe,2021-04-01,,2,nestling, +2021,cypress_city,433,gbhe,2021-04-08,,2,, +2021,cypress_city,433,gbhe,2021-04-16,,2,, +2021,cypress_city,433,gbhe,2021-04-22,,2,, +2021,cypress_city,433,gbhe,2021-04-29,,2,fledged, +2021,cypress_city,506,greg,2021-03-04,,,,"4/8 blue flag placed in nestcup" +2021,cypress_city,506,greg,2021-03-11,1,,incubating,"4/8 blue flag placed in nestcup" +2021,cypress_city,506,greg,2021-03-18,2,,incubating,"4/8 blue flag placed in nestcup" +2021,cypress_city,506,greg,2021-03-25,2,,incubating,"4/8 blue flag placed in nestcup" +2021,cypress_city,506,greg,2021-04-01,0,,empty,"4/8 blue flag placed in nestcup" +2021,cypress_city,506,greg,2021-04-08,,,,"4/8 blue flag placed in nestcup" +2021,cypress_city,506,greg,2021-04-16,,,,"4/8 blue flag placed in nestcup" +2021,cypress_city,506,greg,2021-04-22,,,,"4/8 blue flag placed in nestcup" +2021,cypress_city,506,greg,2021-04-29,,,,"4/8 blue flag placed in nestcup" +2021,cypress_city,508,rosp,2021-03-04,,,,"3/11 Drone Flag south 3/25 drone flag removed" +2021,cypress_city,508,rosp,2021-03-11,3,,incubating,"3/11 Drone Flag south 3/25 drone flag removed" +2021,cypress_city,508,rosp,2021-03-18,4,,incubating,"3/11 Drone Flag south 3/25 drone flag removed" +2021,cypress_city,508,rosp,2021-03-25,4,,incubating,"3/11 Drone Flag south 3/25 drone flag removed" +2021,cypress_city,508,rosp,2021-04-01,3,1,wet_chick,"3/11 Drone Flag south 3/25 drone flag removed" +2021,cypress_city,508,rosp,2021-04-08,,4,,"3/11 Drone Flag south 3/25 drone flag removed" +2021,cypress_city,508,rosp,2021-04-16,,3,,"3/11 Drone Flag south 3/25 drone flag removed" +2021,cypress_city,508,rosp,2021-04-22,,2,,"3/11 Drone Flag south 3/25 drone flag removed" +2021,cypress_city,508,rosp,2021-04-29,,2,fledged,"3/11 Drone Flag south 3/25 drone flag removed" +2021,cypress_city,314,rosp,2021-03-04,,,,"4/16 orange drone flag in nest" +2021,cypress_city,314,rosp,2021-03-11,3,,incubating,"4/16 orange drone flag in nest" +2021,cypress_city,314,rosp,2021-03-18,2,,incubating,"4/16 orange drone flag in nest" +2021,cypress_city,314,rosp,2021-03-25,2,,incubating,"4/16 orange drone flag in nest" +2021,cypress_city,314,rosp,2021-04-01,1,1,hatching,"4/16 orange drone flag in nest" +2021,cypress_city,314,rosp,2021-04-08,,1,,"4/16 orange drone flag in nest" +2021,cypress_city,314,rosp,2021-04-16,,1,,"4/16 orange drone flag in nest" +2021,cypress_city,314,rosp,2021-04-22,,1,,"4/16 orange drone flag in nest" +2021,cypress_city,314,rosp,2021-04-29,,1,fledged,"4/16 orange drone flag in nest" +2021,cypress_city,313,greg,2021-03-04,,,,"3/25 drone flag 4/1 drone flag removed 4/8 yellow flag placed over nestcup" +2021,cypress_city,313,greg,2021-03-11,,,,"3/25 drone flag 4/1 drone flag removed 4/8 yellow flag placed over nestcup" +2021,cypress_city,313,greg,2021-03-18,,,,"3/25 drone flag 4/1 drone flag removed 4/8 yellow flag placed over nestcup" +2021,cypress_city,313,greg,2021-03-25,2,,incubating,"3/25 drone flag 4/1 drone flag removed 4/8 yellow flag placed over nestcup" +2021,cypress_city,313,greg,2021-04-01,0,,empty,"3/25 drone flag 4/1 drone flag removed 4/8 yellow flag placed over nestcup" +2021,cypress_city,313,greg,2021-04-08,,,,"3/25 drone flag 4/1 drone flag removed 4/8 yellow flag placed over nestcup" +2021,cypress_city,313,greg,2021-04-16,,,,"3/25 drone flag 4/1 drone flag removed 4/8 yellow flag placed over nestcup" +2021,cypress_city,313,greg,2021-04-22,,,,"3/25 drone flag 4/1 drone flag removed 4/8 yellow flag placed over nestcup" +2021,cypress_city,313,greg,2021-04-29,,,,"3/25 drone flag 4/1 drone flag removed 4/8 yellow flag placed over nestcup" +2021,cypress_city,733,rosp,2021-03-04,,,,"4/22 2 eggs broken on the ground below nest" +2021,cypress_city,733,rosp,2021-03-11,,,,"4/22 2 eggs broken on the ground below nest" +2021,cypress_city,733,rosp,2021-03-18,,,,"4/22 2 eggs broken on the ground below nest" +2021,cypress_city,733,rosp,2021-03-25,,,,"4/22 2 eggs broken on the ground below nest" +2021,cypress_city,733,rosp,2021-04-01,3,,incubating,"4/22 2 eggs broken on the ground below nest" +2021,cypress_city,733,rosp,2021-04-08,3,,,"4/22 2 eggs broken on the ground below nest" +2021,cypress_city,733,rosp,2021-04-16,3,,,"4/22 2 eggs broken on the ground below nest" +2021,cypress_city,733,rosp,2021-04-22,0,0,empty,"4/22 2 eggs broken on the ground below nest" +2021,cypress_city,733,rosp,2021-04-29,0,0,empty,"4/22 2 eggs broken on the ground below nest" +2021,6th_bridge,56,rosp,2021-02-19,1,,, +2021,6th_bridge,56,rosp,2021-02-26,2,,, +2021,6th_bridge,56,rosp,2021-03-04,4,,, +2021,6th_bridge,56,rosp,2021-03-11,4,,, +2021,6th_bridge,56,rosp,2021-03-18,3,1,, +2021,6th_bridge,56,rosp,2021-03-25,,4,, +2021,6th_bridge,56,rosp,2021-04-01,,3,, +2021,6th_bridge,56,rosp,2021-04-08,,3,, +2021,6th_bridge,56,rosp,2021-04-16,,3,, +2021,6th_bridge,56,rosp,2021-04-22,,2,fledged, +2021,6th_bridge,58,rosp,2021-02-19,2,,, +2021,6th_bridge,58,rosp,2021-02-26,3,,, +2021,6th_bridge,58,rosp,2021-03-04,3,,, +2021,6th_bridge,58,rosp,2021-03-11,3,,, +2021,6th_bridge,58,rosp,2021-03-18,1,2,, +2021,6th_bridge,58,rosp,2021-03-25,,2,, +2021,6th_bridge,58,rosp,2021-04-01,,2,, +2021,6th_bridge,58,rosp,2021-04-08,,2,, +2021,6th_bridge,58,rosp,2021-04-16,,0,fledged, +2021,6th_bridge,58,rosp,2021-04-22,,,, +2021,6th_bridge,60,greg,2021-02-19,2,,, +2021,6th_bridge,60,greg,2021-02-26,2,,, +2021,6th_bridge,60,greg,2021-03-04,2,,, +2021,6th_bridge,60,greg,2021-03-11,1,2,, +2021,6th_bridge,60,greg,2021-03-18,,2,, +2021,6th_bridge,60,greg,2021-03-25,,2,, +2021,6th_bridge,60,greg,2021-04-01,,2,, +2021,6th_bridge,60,greg,2021-04-08,,2,, +2021,6th_bridge,60,greg,2021-04-16,,2,, +2021,6th_bridge,60,greg,2021-04-22,0,0,collapsed, +2021,6th_bridge,62,rosp,2021-02-19,4,,, +2021,6th_bridge,62,rosp,2021-02-26,4,,, +2021,6th_bridge,62,rosp,2021-03-04,4,,, +2021,6th_bridge,62,rosp,2021-03-11,1,3,, +2021,6th_bridge,62,rosp,2021-03-18,,4,, +2021,6th_bridge,62,rosp,2021-03-25,,3,, +2021,6th_bridge,62,rosp,2021-04-01,,3,, +2021,6th_bridge,62,rosp,2021-04-08,,3,, +2021,6th_bridge,62,rosp,2021-04-16,,2,, +2021,6th_bridge,62,rosp,2021-04-22,,2,fledged, +2021,6th_bridge,64,rosp,2021-02-19,3,,, +2021,6th_bridge,64,rosp,2021-02-26,4,,, +2021,6th_bridge,64,rosp,2021-03-04,3,,, +2021,6th_bridge,64,rosp,2021-03-11,1,2,, +2021,6th_bridge,64,rosp,2021-03-18,1,2,, +2021,6th_bridge,64,rosp,2021-03-25,,2,, +2021,6th_bridge,64,rosp,2021-04-01,,2,, +2021,6th_bridge,64,rosp,2021-04-08,,2,, +2021,6th_bridge,64,rosp,2021-04-16,,2,fledged, +2021,6th_bridge,64,rosp,2021-04-22,,,, +2021,6th_bridge,66,greg,2021-02-19,3,,, +2021,6th_bridge,66,greg,2021-02-26,3,,, +2021,6th_bridge,66,greg,2021-03-04,3,,, +2021,6th_bridge,66,greg,2021-03-11,3,,, +2021,6th_bridge,66,greg,2021-03-18,,2,, +2021,6th_bridge,66,greg,2021-03-25,,2,, +2021,6th_bridge,66,greg,2021-04-01,,2,, +2021,6th_bridge,66,greg,2021-04-08,,2,, +2021,6th_bridge,66,greg,2021-04-16,,0,fledged, +2021,6th_bridge,66,greg,2021-04-22,,,, +2021,6th_bridge,76,greg,2021-02-19,3,,, +2021,6th_bridge,76,greg,2021-02-26,0,,empty, +2021,6th_bridge,76,greg,2021-03-04,0,,empty, +2021,6th_bridge,76,greg,2021-03-11,2,,, +2021,6th_bridge,76,greg,2021-03-18,0,,empty, +2021,6th_bridge,76,greg,2021-03-25,,,, +2021,6th_bridge,76,greg,2021-04-01,,,, +2021,6th_bridge,76,greg,2021-04-08,,,, +2021,6th_bridge,76,greg,2021-04-16,,,, +2021,6th_bridge,76,greg,2021-04-22,,,, +2021,6th_bridge,156,greg,2021-02-19,,,, +2021,6th_bridge,156,greg,2021-02-26,3,,, +2021,6th_bridge,156,greg,2021-03-04,3,,, +2021,6th_bridge,156,greg,2021-03-11,3,,, +2021,6th_bridge,156,greg,2021-03-18,3,,, +2021,6th_bridge,156,greg,2021-03-25,,3,, +2021,6th_bridge,156,greg,2021-04-01,,3,, +2021,6th_bridge,156,greg,2021-04-08,,,missed, +2021,6th_bridge,156,greg,2021-04-16,,2,, +2021,6th_bridge,156,greg,2021-04-22,,3,, +2021,6th_bridge,51,greg,2021-02-19,,,, +2021,6th_bridge,51,greg,2021-02-26,1,,, +2021,6th_bridge,51,greg,2021-03-04,3,,, +2021,6th_bridge,51,greg,2021-03-11,3,,, +2021,6th_bridge,51,greg,2021-03-18,2,,, +2021,6th_bridge,51,greg,2021-03-25,2,,pipping, +2021,6th_bridge,51,greg,2021-04-01,,2,, +2021,6th_bridge,51,greg,2021-04-08,,1,, +2021,6th_bridge,51,greg,2021-04-16,,0,empty, +2021,6th_bridge,51,greg,2021-04-22,,0,empty, +2021,6th_bridge,119,greg,2021-02-19,1,,, +2021,6th_bridge,119,greg,2021-02-26,3,,, +2021,6th_bridge,119,greg,2021-03-04,3,,, +2021,6th_bridge,119,greg,2021-03-11,3,,, +2021,6th_bridge,119,greg,2021-03-18,0,,empty, +2021,6th_bridge,119,greg,2021-03-25,,,, +2021,6th_bridge,119,greg,2021-04-01,,,, +2021,6th_bridge,119,greg,2021-04-08,,,, +2021,6th_bridge,119,greg,2021-04-16,,,, +2021,6th_bridge,119,greg,2021-04-22,,,, +2021,6th_bridge,121,greg,2021-02-19,3,,, +2021,6th_bridge,121,greg,2021-02-26,3,,, +2021,6th_bridge,121,greg,2021-03-04,2,,, +2021,6th_bridge,121,greg,2021-03-11,,2,wet_chick, +2021,6th_bridge,121,greg,2021-03-18,,2,, +2021,6th_bridge,121,greg,2021-03-25,,1,, +2021,6th_bridge,121,greg,2021-04-01,,0,empty, +2021,6th_bridge,121,greg,2021-04-08,,,, +2021,6th_bridge,121,greg,2021-04-16,,,, +2021,6th_bridge,121,greg,2021-04-22,,,, +2021,6th_bridge,123,greg,2021-02-19,3,,, +2021,6th_bridge,123,greg,2021-02-26,3,,, +2021,6th_bridge,123,greg,2021-03-04,3,,, +2021,6th_bridge,123,greg,2021-03-11,1,2,, +2021,6th_bridge,123,greg,2021-03-18,,1,, +2021,6th_bridge,123,greg,2021-03-25,1,2,, +2021,6th_bridge,123,greg,2021-04-01,,2,, +2021,6th_bridge,123,greg,2021-04-08,,2,, +2021,6th_bridge,123,greg,2021-04-16,,0,empty, +2021,6th_bridge,123,greg,2021-04-22,,0,empty, +2021,6th_bridge,68,greg,2021-02-19,3,,, +2021,6th_bridge,68,greg,2021-02-26,3,,, +2021,6th_bridge,68,greg,2021-03-04,3,,, +2021,6th_bridge,68,greg,2021-03-11,3,,, +2021,6th_bridge,68,greg,2021-03-18,,3,, +2021,6th_bridge,68,greg,2021-03-25,,3,, +2021,6th_bridge,68,greg,2021-04-01,,3,, +2021,6th_bridge,68,greg,2021-04-08,,3,, +2021,6th_bridge,68,greg,2021-04-16,,,missed, +2021,6th_bridge,68,greg,2021-04-22,,2,, +2021,6th_bridge,70,greg,2021-02-19,3,,, +2021,6th_bridge,70,greg,2021-02-26,2,,, +2021,6th_bridge,70,greg,2021-03-04,2,,, +2021,6th_bridge,70,greg,2021-03-11,2,,, +2021,6th_bridge,70,greg,2021-03-18,,2,, +2021,6th_bridge,70,greg,2021-03-25,,3,, +2021,6th_bridge,70,greg,2021-04-01,,3,, +2021,6th_bridge,70,greg,2021-04-08,,3,, +2021,6th_bridge,70,greg,2021-04-16,,2,, +2021,6th_bridge,70,greg,2021-04-22,,2,, +2021,6th_bridge,125,greg,2021-02-19,0,0,pre_marked, +2021,6th_bridge,125,greg,2021-02-26,3,,, +2021,6th_bridge,125,greg,2021-03-04,3,,, +2021,6th_bridge,125,greg,2021-03-11,3,,, +2021,6th_bridge,125,greg,2021-03-18,3,,, +2021,6th_bridge,125,greg,2021-03-25,,3,, +2021,6th_bridge,125,greg,2021-04-01,,3,, +2021,6th_bridge,125,greg,2021-04-08,,3,, +2021,6th_bridge,125,greg,2021-04-16,,3,, +2021,6th_bridge,125,greg,2021-04-22,,3,, +2021,6th_bridge,158,greg,2021-02-19,,,, +2021,6th_bridge,158,greg,2021-02-26,2,,, +2021,6th_bridge,158,greg,2021-03-04,3,,, +2021,6th_bridge,158,greg,2021-03-11,3,,, +2021,6th_bridge,158,greg,2021-03-18,0,,empty, +2021,6th_bridge,158,greg,2021-03-25,0,,empty, +2021,6th_bridge,158,greg,2021-04-01,0,,empty, +2021,6th_bridge,158,greg,2021-04-08,0,,empty, +2021,6th_bridge,158,greg,2021-04-16,2,,, +2021,6th_bridge,158,greg,2021-04-22,,,missed, +2021,6th_bridge,72,greg,2021-02-19,3,,, +2021,6th_bridge,72,greg,2021-02-26,3,,, +2021,6th_bridge,72,greg,2021-03-04,2,1,, +2021,6th_bridge,72,greg,2021-03-11,1,2,, +2021,6th_bridge,72,greg,2021-03-18,,2,, +2021,6th_bridge,72,greg,2021-03-25,,1,, +2021,6th_bridge,72,greg,2021-04-01,2,,, +2021,6th_bridge,72,greg,2021-04-08,2,,, +2021,6th_bridge,72,greg,2021-04-16,2,,, +2021,6th_bridge,72,greg,2021-04-22,2,,, +2021,6th_bridge,127,greg,2021-02-19,3,,, +2021,6th_bridge,127,greg,2021-02-26,3,,, +2021,6th_bridge,127,greg,2021-03-04,3,,, +2021,6th_bridge,127,greg,2021-03-11,3,,, +2021,6th_bridge,127,greg,2021-03-18,0,,empty, +2021,6th_bridge,127,greg,2021-03-25,,,, +2021,6th_bridge,127,greg,2021-04-01,,,, +2021,6th_bridge,127,greg,2021-04-08,,,, +2021,6th_bridge,127,greg,2021-04-16,,,, +2021,6th_bridge,127,greg,2021-04-22,,,, +2021,6th_bridge,153,greg,2021-02-19,,,, +2021,6th_bridge,153,greg,2021-02-26,3,,, +2021,6th_bridge,153,greg,2021-03-04,0,,empty, +2021,6th_bridge,153,greg,2021-03-11,,,, +2021,6th_bridge,153,greg,2021-03-18,,,, +2021,6th_bridge,153,greg,2021-03-25,,,, +2021,6th_bridge,153,greg,2021-04-01,,,, +2021,6th_bridge,153,greg,2021-04-08,,,, +2021,6th_bridge,153,greg,2021-04-16,,,, +2021,6th_bridge,153,greg,2021-04-22,,,, +2021,6th_bridge,126,greg,2021-02-19,,,, +2021,6th_bridge,126,greg,2021-02-26,3,,, +2021,6th_bridge,126,greg,2021-03-04,3,,, +2021,6th_bridge,126,greg,2021-03-11,3,,, +2021,6th_bridge,126,greg,2021-03-18,0,,empty, +2021,6th_bridge,126,greg,2021-03-25,0,,empty, +2021,6th_bridge,126,greg,2021-04-01,3,,, +2021,6th_bridge,126,greg,2021-04-08,3,,, +2021,6th_bridge,126,greg,2021-04-16,3,,, +2021,6th_bridge,126,greg,2021-04-22,2,,, +2021,6th_bridge,128,greg,2021-02-19,,,, +2021,6th_bridge,128,greg,2021-02-26,3,,, +2021,6th_bridge,128,greg,2021-03-04,2,,, +2021,6th_bridge,128,greg,2021-03-11,3,,, +2021,6th_bridge,128,greg,2021-03-18,3,,pipping, +2021,6th_bridge,128,greg,2021-03-25,,3,, +2021,6th_bridge,128,greg,2021-04-01,,3,, +2021,6th_bridge,128,greg,2021-04-08,,3,, +2021,6th_bridge,128,greg,2021-04-16,,2,, +2021,6th_bridge,128,greg,2021-04-22,,0,empty, +2021,6th_bridge,129,greg,2021-02-19,2,,, +2021,6th_bridge,129,greg,2021-02-26,2,,, +2021,6th_bridge,129,greg,2021-03-04,2,,, +2021,6th_bridge,129,greg,2021-03-11,2,,, +2021,6th_bridge,129,greg,2021-03-18,,1,, +2021,6th_bridge,129,greg,2021-03-25,,1,, +2021,6th_bridge,129,greg,2021-04-01,,1,, +2021,6th_bridge,129,greg,2021-04-08,,1,, +2021,6th_bridge,129,greg,2021-04-16,,1,, +2021,6th_bridge,129,greg,2021-04-22,,0,empty, +2021,6th_bridge,74,greg,2021-02-19,2,,, +2021,6th_bridge,74,greg,2021-02-26,3,,, +2021,6th_bridge,74,greg,2021-03-04,3,,, +2021,6th_bridge,74,greg,2021-03-11,3,,, +2021,6th_bridge,74,greg,2021-03-18,1,2,, +2021,6th_bridge,74,greg,2021-03-25,,3,, +2021,6th_bridge,74,greg,2021-04-01,,3,, +2021,6th_bridge,74,greg,2021-04-08,,2,, +2021,6th_bridge,74,greg,2021-04-16,,2,, +2021,6th_bridge,74,greg,2021-04-22,,0,empty, +2021,6th_bridge,131,greg,2021-02-19,2,,, +2021,6th_bridge,131,greg,2021-02-26,3,,, +2021,6th_bridge,131,greg,2021-03-04,3,,, +2021,6th_bridge,131,greg,2021-03-11,3,,, +2021,6th_bridge,131,greg,2021-03-18,1,2,hatching, +2021,6th_bridge,131,greg,2021-03-25,,3,, +2021,6th_bridge,131,greg,2021-04-01,,3,, +2021,6th_bridge,131,greg,2021-04-08,,3,, +2021,6th_bridge,131,greg,2021-04-16,,0,fledged, +2021,6th_bridge,131,greg,2021-04-22,,0,empty, +2021,6th_bridge,59,greg,2021-02-19,,,, +2021,6th_bridge,59,greg,2021-02-26,1,,, +2021,6th_bridge,59,greg,2021-03-04,2,,, +2021,6th_bridge,59,greg,2021-03-11,3,,, +2021,6th_bridge,59,greg,2021-03-18,0,,empty, +2021,6th_bridge,59,greg,2021-03-25,1,1,wet_chick, +2021,6th_bridge,59,greg,2021-04-01,1,1,, +2021,6th_bridge,59,greg,2021-04-08,0,0,empty, +2021,6th_bridge,59,greg,2021-04-16,,,, +2021,6th_bridge,59,greg,2021-04-22,,,, +2021,6th_bridge,61,greg,2021-02-19,,,, +2021,6th_bridge,61,greg,2021-02-26,3,,, +2021,6th_bridge,61,greg,2021-03-04,3,,, +2021,6th_bridge,61,greg,2021-03-11,0,,empty, +2021,6th_bridge,61,greg,2021-03-18,,,, +2021,6th_bridge,61,greg,2021-03-25,,,, +2021,6th_bridge,61,greg,2021-04-01,,,, +2021,6th_bridge,61,greg,2021-04-08,,,, +2021,6th_bridge,61,greg,2021-04-16,,,, +2021,6th_bridge,61,greg,2021-04-22,,,, +2021,6th_bridge,160,greg,2021-02-19,,,, +2021,6th_bridge,160,greg,2021-02-26,0,0,pre_marked, +2021,6th_bridge,160,greg,2021-03-04,2,,, +2021,6th_bridge,160,greg,2021-03-11,2,,, +2021,6th_bridge,160,greg,2021-03-18,0,,empty, +2021,6th_bridge,160,greg,2021-03-25,1,,, +2021,6th_bridge,160,greg,2021-04-01,3,,, +2021,6th_bridge,160,greg,2021-04-08,3,,, +2021,6th_bridge,160,greg,2021-04-16,3,,, +2021,6th_bridge,160,greg,2021-04-22,1,2,wet_chick, +2021,6th_bridge,55,greg,2021-02-19,,,, +2021,6th_bridge,55,greg,2021-02-26,3,,, +2021,6th_bridge,55,greg,2021-03-04,3,,, +2021,6th_bridge,55,greg,2021-03-11,3,,, +2021,6th_bridge,55,greg,2021-03-18,3,,, +2021,6th_bridge,55,greg,2021-03-25,,3,, +2021,6th_bridge,55,greg,2021-04-01,,3,, +2021,6th_bridge,55,greg,2021-04-08,,3,, +2021,6th_bridge,55,greg,2021-04-16,,3,, +2021,6th_bridge,55,greg,2021-04-22,,2,fledged, +2021,6th_bridge,57,greg,2021-02-19,,,, +2021,6th_bridge,57,greg,2021-02-26,1,,, +2021,6th_bridge,57,greg,2021-03-04,2,,, +2021,6th_bridge,57,greg,2021-03-11,2,,, +2021,6th_bridge,57,greg,2021-03-18,2,,, +2021,6th_bridge,57,greg,2021-03-25,1,1,wet_chick, +2021,6th_bridge,57,greg,2021-04-01,,2,, +2021,6th_bridge,57,greg,2021-04-08,,2,, +2021,6th_bridge,57,greg,2021-04-16,,2,, +2021,6th_bridge,57,greg,2021-04-22,,2,, +2021,6th_bridge,164,rosp,2021-02-19,,,, +2021,6th_bridge,164,rosp,2021-02-26,0,0,pre_marked, +2021,6th_bridge,164,rosp,2021-03-04,1,,, +2021,6th_bridge,164,rosp,2021-03-11,3,,, +2021,6th_bridge,164,rosp,2021-03-18,3,,, +2021,6th_bridge,164,rosp,2021-03-25,3,,, +2021,6th_bridge,164,rosp,2021-04-01,1,3,, +2021,6th_bridge,164,rosp,2021-04-08,1,3,, +2021,6th_bridge,164,rosp,2021-04-16,,2,, +2021,6th_bridge,164,rosp,2021-04-22,,3,fledged, +2021,6th_bridge,166,greg,2021-02-19,,,, +2021,6th_bridge,166,greg,2021-02-26,3,,, +2021,6th_bridge,166,greg,2021-03-04,3,,, +2021,6th_bridge,166,greg,2021-03-11,3,,, +2021,6th_bridge,166,greg,2021-03-18,2,1,wet_chick, +2021,6th_bridge,166,greg,2021-03-25,,3,, +2021,6th_bridge,166,greg,2021-04-01,,3,, +2021,6th_bridge,166,greg,2021-04-08,,2,, +2021,6th_bridge,166,greg,2021-04-16,,2,, +2021,6th_bridge,166,greg,2021-04-22,,0,empty, +2021,6th_bridge,65,greg,2021-02-19,,,, +2021,6th_bridge,65,greg,2021-02-26,1,,, +2021,6th_bridge,65,greg,2021-03-04,2,,, +2021,6th_bridge,65,greg,2021-03-11,2,,, +2021,6th_bridge,65,greg,2021-03-18,2,,, +2021,6th_bridge,65,greg,2021-03-25,1,1,, +2021,6th_bridge,65,greg,2021-04-01,,2,, +2021,6th_bridge,65,greg,2021-04-08,,1,, +2021,6th_bridge,65,greg,2021-04-16,,2,, +2021,6th_bridge,65,greg,2021-04-22,,1,fledged, +2021,6th_bridge,107,rosp,2021-02-19,,,, +2021,6th_bridge,107,rosp,2021-02-26,,,, +2021,6th_bridge,107,rosp,2021-03-04,2,,, +2021,6th_bridge,107,rosp,2021-03-11,4,,, +2021,6th_bridge,107,rosp,2021-03-18,4,,, +2021,6th_bridge,107,rosp,2021-03-25,4,,pipping, +2021,6th_bridge,107,rosp,2021-04-01,1,3,, +2021,6th_bridge,107,rosp,2021-04-08,,3,, +2021,6th_bridge,107,rosp,2021-04-16,,1,, +2021,6th_bridge,107,rosp,2021-04-22,,0,empty, +2021,6th_bridge,187,rosp,2021-02-19,,,, +2021,6th_bridge,187,rosp,2021-02-26,,,, +2021,6th_bridge,187,rosp,2021-03-04,3,,, +2021,6th_bridge,187,rosp,2021-03-11,4,,, +2021,6th_bridge,187,rosp,2021-03-18,4,,, +2021,6th_bridge,187,rosp,2021-03-25,2,2,, +2021,6th_bridge,187,rosp,2021-04-01,,3,, +2021,6th_bridge,187,rosp,2021-04-08,,3,, +2021,6th_bridge,187,rosp,2021-04-16,,4,, +2021,6th_bridge,187,rosp,2021-04-22,,,missed, +2021,6th_bridge,109,rosp,2021-02-19,,,, +2021,6th_bridge,109,rosp,2021-02-26,,,, +2021,6th_bridge,109,rosp,2021-03-04,4,,, +2021,6th_bridge,109,rosp,2021-03-11,4,,, +2021,6th_bridge,109,rosp,2021-03-18,1,3,wet_chick, +2021,6th_bridge,109,rosp,2021-03-25,,4,, +2021,6th_bridge,109,rosp,2021-04-01,,3,, +2021,6th_bridge,109,rosp,2021-04-08,,2,, +2021,6th_bridge,109,rosp,2021-04-16,,0,fledged, +2021,6th_bridge,109,rosp,2021-04-22,,2,fledged, +2021,6th_bridge,111,greg,2021-02-19,,,, +2021,6th_bridge,111,greg,2021-02-26,2,,, +2021,6th_bridge,111,greg,2021-03-04,3,,, +2021,6th_bridge,111,greg,2021-03-11,3,,, +2021,6th_bridge,111,greg,2021-03-18,0,,empty, +2021,6th_bridge,111,greg,2021-03-25,,,, +2021,6th_bridge,111,greg,2021-04-01,,,, +2021,6th_bridge,111,greg,2021-04-08,,,, +2021,6th_bridge,111,greg,2021-04-16,,,, +2021,6th_bridge,111,greg,2021-04-22,,,, +2021,6th_bridge,189,rosp,2021-02-19,,,, +2021,6th_bridge,189,rosp,2021-02-26,,,, +2021,6th_bridge,189,rosp,2021-03-04,2,,, +2021,6th_bridge,189,rosp,2021-03-11,2,,, +2021,6th_bridge,189,rosp,2021-03-18,2,,, +2021,6th_bridge,189,rosp,2021-03-25,0,,empty, +2021,6th_bridge,189,rosp,2021-04-01,,1,, +2021,6th_bridge,189,rosp,2021-04-08,,,, +2021,6th_bridge,189,rosp,2021-04-16,,1,, +2021,6th_bridge,189,rosp,2021-04-22,,1,, +2021,6th_bridge,191,greg,2021-02-19,,,, +2021,6th_bridge,191,greg,2021-02-26,,,, +2021,6th_bridge,191,greg,2021-03-04,1,,, +2021,6th_bridge,191,greg,2021-03-11,2,,, +2021,6th_bridge,191,greg,2021-03-18,,,missed, +2021,6th_bridge,191,greg,2021-03-25,2,,, +2021,6th_bridge,191,greg,2021-04-01,,2,, +2021,6th_bridge,191,greg,2021-04-08,,2,, +2021,6th_bridge,191,greg,2021-04-16,,2,, +2021,6th_bridge,191,greg,2021-04-22,,2,, +2021,6th_bridge,252,greg,2021-02-19,,,, +2021,6th_bridge,252,greg,2021-02-26,,,, +2021,6th_bridge,252,greg,2021-03-04,,,, +2021,6th_bridge,252,greg,2021-03-11,2,,, +2021,6th_bridge,252,greg,2021-03-18,2,,, +2021,6th_bridge,252,greg,2021-03-25,2,,, +2021,6th_bridge,252,greg,2021-04-01,0,,empty, +2021,6th_bridge,252,greg,2021-04-08,,,, +2021,6th_bridge,252,greg,2021-04-16,,,, +2021,6th_bridge,252,greg,2021-04-22,,,, +2021,6th_bridge,312,greg,2021-02-19,,,, +2021,6th_bridge,312,greg,2021-02-26,,,, +2021,6th_bridge,312,greg,2021-03-04,,,, +2021,6th_bridge,312,greg,2021-03-11,3,,, +2021,6th_bridge,312,greg,2021-03-18,3,,, +2021,6th_bridge,312,greg,2021-03-25,,3,, +2021,6th_bridge,312,greg,2021-04-01,,3,, +2021,6th_bridge,312,greg,2021-04-08,,3,, +2021,6th_bridge,312,greg,2021-04-16,,,missed, +2021,6th_bridge,312,greg,2021-04-22,,2,, +2021,6th_bridge,330,greg,2021-02-19,,,, +2021,6th_bridge,330,greg,2021-02-26,,,, +2021,6th_bridge,330,greg,2021-03-04,,,, +2021,6th_bridge,330,greg,2021-03-11,,,, +2021,6th_bridge,330,greg,2021-03-18,2,,, +2021,6th_bridge,330,greg,2021-03-25,2,,, +2021,6th_bridge,330,greg,2021-04-01,2,,, +2021,6th_bridge,330,greg,2021-04-08,2,,pipping, +2021,6th_bridge,330,greg,2021-04-16,,2,, +2021,6th_bridge,330,greg,2021-04-22,,2,, +2021,6th_bridge,358,greg,2021-02-19,,,, +2021,6th_bridge,358,greg,2021-02-26,,,, +2021,6th_bridge,358,greg,2021-03-04,,,, +2021,6th_bridge,358,greg,2021-03-11,,,, +2021,6th_bridge,358,greg,2021-03-18,,,, +2021,6th_bridge,358,greg,2021-03-25,,,, +2021,6th_bridge,358,greg,2021-04-01,2,,, +2021,6th_bridge,358,greg,2021-04-08,3,,, +2021,6th_bridge,358,greg,2021-04-16,3,,, +2021,6th_bridge,358,greg,2021-04-22,3,,, +2021,6th_bridge,360,rosp,2021-02-19,,,, +2021,6th_bridge,360,rosp,2021-02-26,,,, +2021,6th_bridge,360,rosp,2021-03-04,,,, +2021,6th_bridge,360,rosp,2021-03-11,,,, +2021,6th_bridge,360,rosp,2021-03-18,,,, +2021,6th_bridge,360,rosp,2021-03-25,,,, +2021,6th_bridge,360,rosp,2021-04-01,3,,, +2021,6th_bridge,360,rosp,2021-04-08,0,,empty, +2021,6th_bridge,360,rosp,2021-04-16,,3,, +2021,6th_bridge,360,rosp,2021-04-22,,2,, +2021,6th_bridge,362,greg,2021-02-19,,,, +2021,6th_bridge,362,greg,2021-02-26,,,, +2021,6th_bridge,362,greg,2021-03-04,,,, +2021,6th_bridge,362,greg,2021-03-11,,,, +2021,6th_bridge,362,greg,2021-03-18,,,, +2021,6th_bridge,362,greg,2021-03-25,,,, +2021,6th_bridge,362,greg,2021-04-01,3,,, +2021,6th_bridge,362,greg,2021-04-08,3,,, +2021,6th_bridge,362,greg,2021-04-16,3,,, +2021,6th_bridge,362,greg,2021-04-22,3,,, +2021,6th_bridge,745,greg,2021-02-19,,,, +2021,6th_bridge,745,greg,2021-02-26,,,, +2021,6th_bridge,745,greg,2021-03-04,,,, +2021,6th_bridge,745,greg,2021-03-11,,,, +2021,6th_bridge,745,greg,2021-03-18,,,, +2021,6th_bridge,745,greg,2021-03-25,,,, +2021,6th_bridge,745,greg,2021-04-01,,,, +2021,6th_bridge,745,greg,2021-04-08,2,,, +2021,6th_bridge,745,greg,2021-04-16,2,,, +2021,6th_bridge,745,greg,2021-04-22,2,,, +2021,6th_bridge,755,smhe,2021-02-19,,,, +2021,6th_bridge,755,smhe,2021-02-26,,,, +2021,6th_bridge,755,smhe,2021-03-04,,,, +2021,6th_bridge,755,smhe,2021-03-11,,,, +2021,6th_bridge,755,smhe,2021-03-18,,,, +2021,6th_bridge,755,smhe,2021-03-25,,,, +2021,6th_bridge,755,smhe,2021-04-01,,,, +2021,6th_bridge,755,smhe,2021-04-08,,,, +2021,6th_bridge,755,smhe,2021-04-16,2,,, +2021,6th_bridge,755,smhe,2021-04-22,3,,, +2021,6th_bridge,757,glib,2021-02-19,,,, +2021,6th_bridge,757,glib,2021-02-26,,,, +2021,6th_bridge,757,glib,2021-03-04,,,, +2021,6th_bridge,757,glib,2021-03-11,,,, +2021,6th_bridge,757,glib,2021-03-18,,,, +2021,6th_bridge,757,glib,2021-03-25,,,, +2021,6th_bridge,757,glib,2021-04-01,,,, +2021,6th_bridge,757,glib,2021-04-08,,,, +2021,6th_bridge,757,glib,2021-04-16,1,,, +2021,6th_bridge,757,glib,2021-04-22,3,,, +2021,6th_bridge,759,smhe,2021-02-19,,,, +2021,6th_bridge,759,smhe,2021-02-26,,,, +2021,6th_bridge,759,smhe,2021-03-04,,,, +2021,6th_bridge,759,smhe,2021-03-11,,,, +2021,6th_bridge,759,smhe,2021-03-18,,,, +2021,6th_bridge,759,smhe,2021-03-25,,,, +2021,6th_bridge,759,smhe,2021-04-01,,,, +2021,6th_bridge,759,smhe,2021-04-08,,,, +2021,6th_bridge,759,smhe,2021-04-16,2,,, +2021,6th_bridge,759,smhe,2021-04-22,3,,, +2021,6th_bridge,761,glib,2021-02-19,,,, +2021,6th_bridge,761,glib,2021-02-26,,,, +2021,6th_bridge,761,glib,2021-03-04,,,, +2021,6th_bridge,761,glib,2021-03-11,,,, +2021,6th_bridge,761,glib,2021-03-18,,,, +2021,6th_bridge,761,glib,2021-03-25,,,, +2021,6th_bridge,761,glib,2021-04-01,,,, +2021,6th_bridge,761,glib,2021-04-08,,,, +2021,6th_bridge,761,glib,2021-04-16,1,,, +2021,6th_bridge,761,glib,2021-04-22,2,,, +2021,6th_bridge,763,glib,2021-02-19,,,, +2021,6th_bridge,763,glib,2021-02-26,,,, +2021,6th_bridge,763,glib,2021-03-04,,,, +2021,6th_bridge,763,glib,2021-03-11,,,, +2021,6th_bridge,763,glib,2021-03-18,,,, +2021,6th_bridge,763,glib,2021-03-25,,,, +2021,6th_bridge,763,glib,2021-04-01,,,, +2021,6th_bridge,763,glib,2021-04-08,,,, +2021,6th_bridge,763,glib,2021-04-16,1,,, +2021,6th_bridge,763,glib,2021-04-22,3,,, +2021,6th_bridge,765,smhe,2021-02-19,,,, +2021,6th_bridge,765,smhe,2021-02-26,,,, +2021,6th_bridge,765,smhe,2021-03-04,,,, +2021,6th_bridge,765,smhe,2021-03-11,,,, +2021,6th_bridge,765,smhe,2021-03-18,,,, +2021,6th_bridge,765,smhe,2021-03-25,,,, +2021,6th_bridge,765,smhe,2021-04-01,,,, +2021,6th_bridge,765,smhe,2021-04-08,,,, +2021,6th_bridge,765,smhe,2021-04-16,4,,, +2021,6th_bridge,765,smhe,2021-04-22,4,,, +2021,6th_bridge,767,whib,2021-02-19,,,, +2021,6th_bridge,767,whib,2021-02-26,,,, +2021,6th_bridge,767,whib,2021-03-04,,,, +2021,6th_bridge,767,whib,2021-03-11,,,, +2021,6th_bridge,767,whib,2021-03-18,,,, +2021,6th_bridge,767,whib,2021-03-25,,,, +2021,6th_bridge,767,whib,2021-04-01,,,, +2021,6th_bridge,767,whib,2021-04-08,,,, +2021,6th_bridge,767,whib,2021-04-16,1,,, +2021,6th_bridge,767,whib,2021-04-22,0,0,empty, +2021,6th_bridge,769,greg,2021-02-19,,,, +2021,6th_bridge,769,greg,2021-02-26,,,, +2021,6th_bridge,769,greg,2021-03-04,,,, +2021,6th_bridge,769,greg,2021-03-11,,,, +2021,6th_bridge,769,greg,2021-03-18,,,, +2021,6th_bridge,769,greg,2021-03-25,,,, +2021,6th_bridge,769,greg,2021-04-01,,,, +2021,6th_bridge,769,greg,2021-04-08,,,, +2021,6th_bridge,769,greg,2021-04-16,2,,, +2021,6th_bridge,769,greg,2021-04-22,2,,, +2021,6th_bridge,771,smhe,2021-02-19,,,, +2021,6th_bridge,771,smhe,2021-02-26,,,, +2021,6th_bridge,771,smhe,2021-03-04,,,, +2021,6th_bridge,771,smhe,2021-03-11,,,, +2021,6th_bridge,771,smhe,2021-03-18,,,, +2021,6th_bridge,771,smhe,2021-03-25,,,, +2021,6th_bridge,771,smhe,2021-04-01,,,, +2021,6th_bridge,771,smhe,2021-04-08,,,, +2021,6th_bridge,771,smhe,2021-04-16,3,,, +2021,6th_bridge,771,smhe,2021-04-22,3,,, +2021,6th_bridge,773,smhe,2021-02-19,,,, +2021,6th_bridge,773,smhe,2021-02-26,,,, +2021,6th_bridge,773,smhe,2021-03-04,,,, +2021,6th_bridge,773,smhe,2021-03-11,,,, +2021,6th_bridge,773,smhe,2021-03-18,,,, +2021,6th_bridge,773,smhe,2021-03-25,,,, +2021,6th_bridge,773,smhe,2021-04-01,,,, +2021,6th_bridge,773,smhe,2021-04-08,,,, +2021,6th_bridge,773,smhe,2021-04-16,2,,, +2021,6th_bridge,773,smhe,2021-04-22,2,,, +2021,6th_bridge,775,glib,2021-02-19,,,, +2021,6th_bridge,775,glib,2021-02-26,,,, +2021,6th_bridge,775,glib,2021-03-04,,,, +2021,6th_bridge,775,glib,2021-03-11,,,, +2021,6th_bridge,775,glib,2021-03-18,,,, +2021,6th_bridge,775,glib,2021-03-25,,,, +2021,6th_bridge,775,glib,2021-04-01,,,, +2021,6th_bridge,775,glib,2021-04-08,,,, +2021,6th_bridge,775,glib,2021-04-16,2,,, +2021,6th_bridge,775,glib,2021-04-22,0,0,empty, +2021,6th_bridge,628,whib,2021-02-19,,,, +2021,6th_bridge,628,whib,2021-02-26,,,, +2021,6th_bridge,628,whib,2021-03-04,,,, +2021,6th_bridge,628,whib,2021-03-11,,,, +2021,6th_bridge,628,whib,2021-03-18,,,, +2021,6th_bridge,628,whib,2021-03-25,,,, +2021,6th_bridge,628,whib,2021-04-01,,,, +2021,6th_bridge,628,whib,2021-04-08,,,, +2021,6th_bridge,628,whib,2021-04-16,,,, +2021,6th_bridge,628,whib,2021-04-22,2,,, +2021,6th_bridge,630,whib,2021-02-19,,,, +2021,6th_bridge,630,whib,2021-02-26,,,, +2021,6th_bridge,630,whib,2021-03-04,,,, +2021,6th_bridge,630,whib,2021-03-11,,,, +2021,6th_bridge,630,whib,2021-03-18,,,, +2021,6th_bridge,630,whib,2021-03-25,,,, +2021,6th_bridge,630,whib,2021-04-01,,,, +2021,6th_bridge,630,whib,2021-04-08,,,, +2021,6th_bridge,630,whib,2021-04-16,,,, +2021,6th_bridge,630,whib,2021-04-22,2,,, +2021,6th_bridge,632,smhe,2021-02-19,,,, +2021,6th_bridge,632,smhe,2021-02-26,,,, +2021,6th_bridge,632,smhe,2021-03-04,,,, +2021,6th_bridge,632,smhe,2021-03-11,,,, +2021,6th_bridge,632,smhe,2021-03-18,,,, +2021,6th_bridge,632,smhe,2021-03-25,,,, +2021,6th_bridge,632,smhe,2021-04-01,,,, +2021,6th_bridge,632,smhe,2021-04-08,,,, +2021,6th_bridge,632,smhe,2021-04-16,,,, +2021,6th_bridge,632,smhe,2021-04-22,3,,, +2021,6th_bridge,640,smhe,2021-02-19,,,, +2021,6th_bridge,640,smhe,2021-02-26,,,, +2021,6th_bridge,640,smhe,2021-03-04,,,, +2021,6th_bridge,640,smhe,2021-03-11,,,, +2021,6th_bridge,640,smhe,2021-03-18,,,, +2021,6th_bridge,640,smhe,2021-03-25,,,, +2021,6th_bridge,640,smhe,2021-04-01,,,, +2021,6th_bridge,640,smhe,2021-04-08,,,, +2021,6th_bridge,640,smhe,2021-04-16,,,, +2021,6th_bridge,640,smhe,2021-04-22,4,,, +2021,6th_bridge,642,greg,2021-02-19,,,, +2021,6th_bridge,642,greg,2021-02-26,,,, +2021,6th_bridge,642,greg,2021-03-04,,,, +2021,6th_bridge,642,greg,2021-03-11,,,, +2021,6th_bridge,642,greg,2021-03-18,,,, +2021,6th_bridge,642,greg,2021-03-25,,,, +2021,6th_bridge,642,greg,2021-04-01,,,, +2021,6th_bridge,642,greg,2021-04-08,,,, +2021,6th_bridge,642,greg,2021-04-16,,,, +2021,6th_bridge,642,greg,2021-04-22,2,,, +2021,6th_bridge,644,smhe,2021-02-19,,,, +2021,6th_bridge,644,smhe,2021-02-26,,,, +2021,6th_bridge,644,smhe,2021-03-04,,,, +2021,6th_bridge,644,smhe,2021-03-11,,,, +2021,6th_bridge,644,smhe,2021-03-18,,,, +2021,6th_bridge,644,smhe,2021-03-25,,,, +2021,6th_bridge,644,smhe,2021-04-01,,,, +2021,6th_bridge,644,smhe,2021-04-08,,,, +2021,6th_bridge,644,smhe,2021-04-16,,,, +2021,6th_bridge,644,smhe,2021-04-22,4,,, +2021,6th_bridge,646,glib,2021-02-19,,,, +2021,6th_bridge,646,glib,2021-02-26,,,, +2021,6th_bridge,646,glib,2021-03-04,,,, +2021,6th_bridge,646,glib,2021-03-11,,,, +2021,6th_bridge,646,glib,2021-03-18,,,, +2021,6th_bridge,646,glib,2021-03-25,,,, +2021,6th_bridge,646,glib,2021-04-01,,,, +2021,6th_bridge,646,glib,2021-04-08,,,, +2021,6th_bridge,646,glib,2021-04-16,,,, +2021,6th_bridge,646,glib,2021-04-22,3,,, +2021,alley_north,321,whib,2021-03-09,3,,,"4/27 TRANSECT PULLED!!" +2021,alley_north,321,whib,2021-03-16,3,,,"4/27 TRANSECT PULLED!!" +2021,alley_north,321,whib,2021-03-23,1,,,"4/27 TRANSECT PULLED!!" +2021,alley_north,321,whib,2021-03-30,,1,,"4/27 TRANSECT PULLED!!" +2021,alley_north,321,whib,2021-04-06,,1,,"4/27 TRANSECT PULLED!!" +2021,alley_north,321,whib,2021-04-14,,0,empty,"4/27 TRANSECT PULLED!!" +2021,alley_north,321,whib,2021-04-20,,1,,"4/27 TRANSECT PULLED!!" +2021,alley_north,321,whib,2021-04-27,0,,fledged,"4/27 TRANSECT PULLED!!" +2021,alley_north,406,whib,2021-03-09,2,,,"3/16 WHIB egg broken on the ground below nest 3/30 nest collapsed" +2021,alley_north,406,whib,2021-03-16,0,,empty,"3/16 WHIB egg broken on the ground below nest 3/30 nest collapsed" +2021,alley_north,406,whib,2021-03-23,,,,"3/16 WHIB egg broken on the ground below nest 3/30 nest collapsed" +2021,alley_north,406,whib,2021-03-30,,,,"3/16 WHIB egg broken on the ground below nest 3/30 nest collapsed" +2021,alley_north,406,whib,2021-04-06,,,,"3/16 WHIB egg broken on the ground below nest 3/30 nest collapsed" +2021,alley_north,406,whib,2021-04-14,,,,"3/16 WHIB egg broken on the ground below nest 3/30 nest collapsed" +2021,alley_north,406,whib,2021-04-20,,,,"3/16 WHIB egg broken on the ground below nest 3/30 nest collapsed" +2021,alley_north,406,whib,2021-04-27,,,,"3/16 WHIB egg broken on the ground below nest 3/30 nest collapsed" +2021,alley_north,408,whib,2021-03-09,2,,, +2021,alley_north,408,whib,2021-03-16,0,,empty, +2021,alley_north,408,whib,2021-03-23,,,, +2021,alley_north,408,whib,2021-03-30,,,, +2021,alley_north,408,whib,2021-04-06,,,, +2021,alley_north,408,whib,2021-04-14,,,, +2021,alley_north,408,whib,2021-04-20,,,, +2021,alley_north,408,whib,2021-04-27,,,, +2021,alley_north,331,whib,2021-03-09,2,,,"3/16 collapsed" +2021,alley_north,331,whib,2021-03-16,0,,empty,"3/16 collapsed" +2021,alley_north,331,whib,2021-03-23,,,,"3/16 collapsed" +2021,alley_north,331,whib,2021-03-30,,,,"3/16 collapsed" +2021,alley_north,331,whib,2021-04-06,,,,"3/16 collapsed" +2021,alley_north,331,whib,2021-04-14,,,,"3/16 collapsed" +2021,alley_north,331,whib,2021-04-20,,,,"3/16 collapsed" +2021,alley_north,331,whib,2021-04-27,,,,"3/16 collapsed" +2021,alley_north,323,whib,2021-03-09,2,,, +2021,alley_north,323,whib,2021-03-16,2,,, +2021,alley_north,323,whib,2021-03-23,2,,, +2021,alley_north,323,whib,2021-03-30,,2,, +2021,alley_north,323,whib,2021-04-06,,1,, +2021,alley_north,323,whib,2021-04-14,,1,, +2021,alley_north,323,whib,2021-04-20,,0,fledged, +2021,alley_north,323,whib,2021-04-27,,,, +2021,alley_north,325,whib,2021-03-09,2,,, +2021,alley_north,325,whib,2021-03-16,2,,, +2021,alley_north,325,whib,2021-03-23,2,,, +2021,alley_north,325,whib,2021-03-30,1,1,, +2021,alley_north,325,whib,2021-04-06,1,1,, +2021,alley_north,325,whib,2021-04-14,1,1,, +2021,alley_north,325,whib,2021-04-20,,0,fledged, +2021,alley_north,325,whib,2021-04-27,,,, +2021,alley_north,327,whib,2021-03-09,2,,, +2021,alley_north,327,whib,2021-03-16,2,,, +2021,alley_north,327,whib,2021-03-23,2,,, +2021,alley_north,327,whib,2021-03-30,,2,, +2021,alley_north,327,whib,2021-04-06,,2,, +2021,alley_north,327,whib,2021-04-14,,2,, +2021,alley_north,327,whib,2021-04-20,,0,fledged, +2021,alley_north,327,whib,2021-04-27,,,, +2021,alley_north,329,whib,2021-03-09,2,,, +2021,alley_north,329,whib,2021-03-16,2,,, +2021,alley_north,329,whib,2021-03-23,2,,, +2021,alley_north,329,whib,2021-03-30,,1,, +2021,alley_north,329,whib,2021-04-06,,1,, +2021,alley_north,329,whib,2021-04-14,,1,, +2021,alley_north,329,whib,2021-04-20,,0,fledged, +2021,alley_north,329,whib,2021-04-27,,,, +2021,alley_north,435,greg,2021-03-09,2,,, +2021,alley_north,435,greg,2021-03-16,0,,empty, +2021,alley_north,435,greg,2021-03-23,,,, +2021,alley_north,435,greg,2021-03-30,,,, +2021,alley_north,435,greg,2021-04-06,,,, +2021,alley_north,435,greg,2021-04-14,,,, +2021,alley_north,435,greg,2021-04-20,,,, +2021,alley_north,435,greg,2021-04-27,,,, +2021,alley_north,437,whib,2021-03-09,2,,, +2021,alley_north,437,whib,2021-03-16,2,,, +2021,alley_north,437,whib,2021-03-23,2,,, +2021,alley_north,437,whib,2021-03-30,1,1,, +2021,alley_north,437,whib,2021-04-06,,2,, +2021,alley_north,437,whib,2021-04-14,,2,, +2021,alley_north,437,whib,2021-04-20,,2,, +2021,alley_north,437,whib,2021-04-27,,0,fledged, +2021,alley_north,439,whib,2021-03-09,2,,,"3/30 collapsed" +2021,alley_north,439,whib,2021-03-16,0,,empty,"3/30 collapsed" +2021,alley_north,439,whib,2021-03-23,,,,"3/30 collapsed" +2021,alley_north,439,whib,2021-03-30,,,,"3/30 collapsed" +2021,alley_north,439,whib,2021-04-06,,,,"3/30 collapsed" +2021,alley_north,439,whib,2021-04-14,,,,"3/30 collapsed" +2021,alley_north,439,whib,2021-04-20,,,,"3/30 collapsed" +2021,alley_north,439,whib,2021-04-27,,,,"3/30 collapsed" +2021,alley_north,441,whib,2021-03-09,1,,, +2021,alley_north,441,whib,2021-03-16,2,,, +2021,alley_north,441,whib,2021-03-23,2,,, +2021,alley_north,441,whib,2021-03-30,1,,, +2021,alley_north,441,whib,2021-04-06,1,,, +2021,alley_north,441,whib,2021-04-14,1,,, +2021,alley_north,441,whib,2021-04-20,1,,, +2021,alley_north,441,whib,2021-04-27,,,, +2021,alley_north,443,whib,2021-03-09,1,,, +2021,alley_north,443,whib,2021-03-16,0,,empty, +2021,alley_north,443,whib,2021-03-23,,,, +2021,alley_north,443,whib,2021-03-30,,,, +2021,alley_north,443,whib,2021-04-06,,,, +2021,alley_north,443,whib,2021-04-14,,,, +2021,alley_north,443,whib,2021-04-20,,,, +2021,alley_north,443,whib,2021-04-27,,,, +2021,alley_north,410,whib,2021-03-09,2,,, +2021,alley_north,410,whib,2021-03-16,2,,, +2021,alley_north,410,whib,2021-03-23,2,,, +2021,alley_north,410,whib,2021-03-30,1,1,pipping, +2021,alley_north,410,whib,2021-04-06,,2,, +2021,alley_north,410,whib,2021-04-14,,2,, +2021,alley_north,410,whib,2021-04-20,,1,, +2021,alley_north,410,whib,2021-04-27,,0,fledged, +2021,alley_north,412,whib,2021-03-09,2,,, +2021,alley_north,412,whib,2021-03-16,2,,, +2021,alley_north,412,whib,2021-03-23,2,,, +2021,alley_north,412,whib,2021-03-30,,2,, +2021,alley_north,412,whib,2021-04-06,,2,, +2021,alley_north,412,whib,2021-04-14,,2,, +2021,alley_north,412,whib,2021-04-20,,0,fledged, +2021,alley_north,412,whib,2021-04-27,,0,fledged, +2021,alley_north,414,whib,2021-03-09,1,,,"3/23 collapsed" +2021,alley_north,414,whib,2021-03-16,1,,,"3/23 collapsed" +2021,alley_north,414,whib,2021-03-23,0,,empty,"3/23 collapsed" +2021,alley_north,414,whib,2021-03-30,,,,"3/23 collapsed" +2021,alley_north,414,whib,2021-04-06,,,,"3/23 collapsed" +2021,alley_north,414,whib,2021-04-14,,,,"3/23 collapsed" +2021,alley_north,414,whib,2021-04-20,,,,"3/23 collapsed" +2021,alley_north,414,whib,2021-04-27,,,,"3/23 collapsed" +2021,alley_north,445,whib,2021-03-09,1,,,"3/16 collapsed" +2021,alley_north,445,whib,2021-03-16,0,,empty,"3/16 collapsed" +2021,alley_north,445,whib,2021-03-23,,,,"3/16 collapsed" +2021,alley_north,445,whib,2021-03-30,,,,"3/16 collapsed" +2021,alley_north,445,whib,2021-04-06,,,,"3/16 collapsed" +2021,alley_north,445,whib,2021-04-14,,,,"3/16 collapsed" +2021,alley_north,445,whib,2021-04-20,,,,"3/16 collapsed" +2021,alley_north,445,whib,2021-04-27,,,,"3/16 collapsed" +2021,alley_north,447,whib,2021-03-09,2,,, +2021,alley_north,447,whib,2021-03-16,2,,, +2021,alley_north,447,whib,2021-03-23,2,,, +2021,alley_north,447,whib,2021-03-30,2,,, +2021,alley_north,447,whib,2021-04-06,2,,, +2021,alley_north,447,whib,2021-04-14,2,,, +2021,alley_north,447,whib,2021-04-20,1,,, +2021,alley_north,447,whib,2021-04-27,,0,fledged, +2021,alley_north,449,whib,2021-03-09,1,,, +2021,alley_north,449,whib,2021-03-16,2,,, +2021,alley_north,449,whib,2021-03-23,2,,, +2021,alley_north,449,whib,2021-03-30,,2,, +2021,alley_north,449,whib,2021-04-06,,2,, +2021,alley_north,449,whib,2021-04-14,,1,, +2021,alley_north,449,whib,2021-04-20,,1,, +2021,alley_north,449,whib,2021-04-27,,0,fledged, +2021,alley_north,333,whib,2021-03-09,2,,, +2021,alley_north,333,whib,2021-03-16,2,,, +2021,alley_north,333,whib,2021-03-23,2,,, +2021,alley_north,333,whib,2021-03-30,,2,, +2021,alley_north,333,whib,2021-04-06,,2,, +2021,alley_north,333,whib,2021-04-14,,2,, +2021,alley_north,333,whib,2021-04-20,,0,fledged, +2021,alley_north,333,whib,2021-04-27,,0,fledged, +2021,alley_north,416,whib,2021-03-09,2,,, +2021,alley_north,416,whib,2021-03-16,2,,, +2021,alley_north,416,whib,2021-03-23,2,,, +2021,alley_north,416,whib,2021-03-30,1,1,, +2021,alley_north,416,whib,2021-04-06,1,1,, +2021,alley_north,416,whib,2021-04-14,,1,, +2021,alley_north,416,whib,2021-04-20,1,,, +2021,alley_north,416,whib,2021-04-27,,0,fledged, +2021,alley_north,418,whib,2021-03-09,1,,, +2021,alley_north,418,whib,2021-03-16,1,,, +2021,alley_north,418,whib,2021-03-23,1,,, +2021,alley_north,418,whib,2021-03-30,,1,, +2021,alley_north,418,whib,2021-04-06,,1,, +2021,alley_north,418,whib,2021-04-14,,1,, +2021,alley_north,418,whib,2021-04-20,,0,fledged, +2021,alley_north,418,whib,2021-04-27,,,, +2021,alley_north,420,whib,2021-03-09,2,,, +2021,alley_north,420,whib,2021-03-16,2,,, +2021,alley_north,420,whib,2021-03-23,2,,, +2021,alley_north,420,whib,2021-03-30,1,1,, +2021,alley_north,420,whib,2021-04-06,,2,, +2021,alley_north,420,whib,2021-04-14,,2,, +2021,alley_north,420,whib,2021-04-20,,0,fledged, +2021,alley_north,420,whib,2021-04-27,,,, +2021,alley_north,422,whib,2021-03-09,2,,,"4/14 nest collapsed" +2021,alley_north,422,whib,2021-03-16,2,,,"4/14 nest collapsed" +2021,alley_north,422,whib,2021-03-23,2,,,"4/14 nest collapsed" +2021,alley_north,422,whib,2021-03-30,,2,,"4/14 nest collapsed" +2021,alley_north,422,whib,2021-04-06,,2,,"4/14 nest collapsed" +2021,alley_north,422,whib,2021-04-14,,0,empty,"4/14 nest collapsed" +2021,alley_north,422,whib,2021-04-20,,,,"4/14 nest collapsed" +2021,alley_north,422,whib,2021-04-27,,,,"4/14 nest collapsed" +2021,alley_north,424,whib,2021-03-09,3,,, +2021,alley_north,424,whib,2021-03-16,4,,, +2021,alley_north,424,whib,2021-03-23,3,,, +2021,alley_north,424,whib,2021-03-30,,2,, +2021,alley_north,424,whib,2021-04-06,,3,, +2021,alley_north,424,whib,2021-04-14,,3,, +2021,alley_north,424,whib,2021-04-20,,0,fledged, +2021,alley_north,424,whib,2021-04-27,,,, +2021,alley_north,426,whib,2021-03-09,2,,,"4/14 1 dead chick" +2021,alley_north,426,whib,2021-03-16,2,,,"4/14 1 dead chick" +2021,alley_north,426,whib,2021-03-23,2,,,"4/14 1 dead chick" +2021,alley_north,426,whib,2021-03-30,,2,,"4/14 1 dead chick" +2021,alley_north,426,whib,2021-04-06,,1,,"4/14 1 dead chick" +2021,alley_north,426,whib,2021-04-14,,0,empty,"4/14 1 dead chick" +2021,alley_north,426,whib,2021-04-20,,0,fledged,"4/14 1 dead chick" +2021,alley_north,426,whib,2021-04-27,,0,fledged,"4/14 1 dead chick" +2021,alley_north,428,whib,2021-03-09,2,,, +2021,alley_north,428,whib,2021-03-16,0,,empty, +2021,alley_north,428,whib,2021-03-23,,,, +2021,alley_north,428,whib,2021-03-30,,,, +2021,alley_north,428,whib,2021-04-06,,,, +2021,alley_north,428,whib,2021-04-14,,,, +2021,alley_north,428,whib,2021-04-20,,,, +2021,alley_north,428,whib,2021-04-27,,,, +2021,alley_north,451,greg,2021-03-09,3,,,"4/20 mercury" +2021,alley_north,451,greg,2021-03-16,3,,,"4/20 mercury" +2021,alley_north,451,greg,2021-03-23,1,2,,"4/20 mercury" +2021,alley_north,451,greg,2021-03-30,,3,,"4/20 mercury" +2021,alley_north,451,greg,2021-04-06,,2,,"4/20 mercury" +2021,alley_north,451,greg,2021-04-14,,3,,"4/20 mercury" +2021,alley_north,451,greg,2021-04-20,,2,,"4/20 mercury" +2021,alley_north,451,greg,2021-04-27,,3,fledged,"4/20 mercury" +2021,alley_north,335,greg,2021-03-09,2,,,"3/30 collapsed" +2021,alley_north,335,greg,2021-03-16,0,,empty,"3/30 collapsed" +2021,alley_north,335,greg,2021-03-23,,,,"3/30 collapsed" +2021,alley_north,335,greg,2021-03-30,,,,"3/30 collapsed" +2021,alley_north,335,greg,2021-04-06,,,,"3/30 collapsed" +2021,alley_north,335,greg,2021-04-14,,,,"3/30 collapsed" +2021,alley_north,335,greg,2021-04-20,,,,"3/30 collapsed" +2021,alley_north,335,greg,2021-04-27,,,,"3/30 collapsed" +2021,alley_north,453,rosp,2021-03-09,3,,, +2021,alley_north,453,rosp,2021-03-16,1,2,, +2021,alley_north,453,rosp,2021-03-23,,3,, +2021,alley_north,453,rosp,2021-03-30,,3,, +2021,alley_north,453,rosp,2021-04-06,,3,, +2021,alley_north,453,rosp,2021-04-14,,0,fledged, +2021,alley_north,453,rosp,2021-04-20,,,, +2021,alley_north,453,rosp,2021-04-27,,,, +2021,alley_north,455,greg,2021-03-09,3,,, +2021,alley_north,455,greg,2021-03-16,3,,, +2021,alley_north,455,greg,2021-03-23,3,,, +2021,alley_north,455,greg,2021-03-30,2,1,wet_chick, +2021,alley_north,455,greg,2021-04-06,,3,, +2021,alley_north,455,greg,2021-04-14,,3,, +2021,alley_north,455,greg,2021-04-20,,3,, +2021,alley_north,455,greg,2021-04-27,,0,fledged, +2021,alley_north,457,rosp,2021-03-09,4,,, +2021,alley_north,457,rosp,2021-03-16,2,2,, +2021,alley_north,457,rosp,2021-03-23,,4,, +2021,alley_north,457,rosp,2021-03-30,,4,, +2021,alley_north,457,rosp,2021-04-06,,3,, +2021,alley_north,457,rosp,2021-04-14,,0,empty, +2021,alley_north,457,rosp,2021-04-20,,,, +2021,alley_north,457,rosp,2021-04-27,,,, +2021,alley_north,459,greg,2021-03-09,2,,, +2021,alley_north,459,greg,2021-03-16,2,,, +2021,alley_north,459,greg,2021-03-23,,2,, +2021,alley_north,459,greg,2021-03-30,,2,, +2021,alley_north,459,greg,2021-04-06,,2,, +2021,alley_north,459,greg,2021-04-14,,2,, +2021,alley_north,459,greg,2021-04-20,,2,, +2021,alley_north,459,greg,2021-04-27,,0,fledged, +2021,alley_north,542,whib,2021-03-09,,,,"3/23 new" +2021,alley_north,542,whib,2021-03-16,,,,"3/23 new" +2021,alley_north,542,whib,2021-03-23,3,,,"3/23 new" +2021,alley_north,542,whib,2021-03-30,1,2,,"3/23 new" +2021,alley_north,542,whib,2021-04-06,,2,,"3/23 new" +2021,alley_north,542,whib,2021-04-14,,2,,"3/23 new" +2021,alley_north,542,whib,2021-04-20,,0,fledged,"3/23 new" +2021,alley_north,542,whib,2021-04-27,,,,"3/23 new" +2021,alley_north,544,whib,2021-03-09,,,,"3/23 new" +2021,alley_north,544,whib,2021-03-16,,,,"3/23 new" +2021,alley_north,544,whib,2021-03-23,2,,,"3/23 new" +2021,alley_north,544,whib,2021-03-30,,2,,"3/23 new" +2021,alley_north,544,whib,2021-04-06,,2,,"3/23 new" +2021,alley_north,544,whib,2021-04-14,,2,,"3/23 new" +2021,alley_north,544,whib,2021-04-20,,1,,"3/23 new" +2021,alley_north,544,whib,2021-04-27,,0,fledged,"3/23 new" +2021,alley_north,337,whib,2021-03-09,2,,, +2021,alley_north,337,whib,2021-03-16,3,,, +2021,alley_north,337,whib,2021-03-23,3,,, +2021,alley_north,337,whib,2021-03-30,1,2,, +2021,alley_north,337,whib,2021-04-06,,3,, +2021,alley_north,337,whib,2021-04-14,,0,empty, +2021,alley_north,337,whib,2021-04-20,,,, +2021,alley_north,337,whib,2021-04-27,,,, +2021,alley_north,339,whib,2021-03-09,2,,,"4/14 3+ C between 339 and 341" +2021,alley_north,339,whib,2021-03-16,2,,,"4/14 3+ C between 339 and 341" +2021,alley_north,339,whib,2021-03-23,2,,,"4/14 3+ C between 339 and 341" +2021,alley_north,339,whib,2021-03-30,,2,,"4/14 3+ C between 339 and 341" +2021,alley_north,339,whib,2021-04-06,,2,,"4/14 3+ C between 339 and 341" +2021,alley_north,339,whib,2021-04-14,,1,,"4/14 3+ C between 339 and 341" +2021,alley_north,339,whib,2021-04-20,,0,fledged,"4/14 3+ C between 339 and 341" +2021,alley_north,339,whib,2021-04-27,,0,fledged,"4/14 3+ C between 339 and 341" +2021,alley_north,341,whib,2021-03-09,2,,,"4/14 3+ C between 339 and 341" +2021,alley_north,341,whib,2021-03-16,2,,,"4/14 3+ C between 339 and 341" +2021,alley_north,341,whib,2021-03-23,2,,,"4/14 3+ C between 339 and 341" +2021,alley_north,341,whib,2021-03-30,,2,,"4/14 3+ C between 339 and 341" +2021,alley_north,341,whib,2021-04-06,,2,,"4/14 3+ C between 339 and 341" +2021,alley_north,341,whib,2021-04-14,,2,,"4/14 3+ C between 339 and 341" +2021,alley_north,341,whib,2021-04-20,,0,fledged,"4/14 3+ C between 339 and 341" +2021,alley_north,341,whib,2021-04-27,,,,"4/14 3+ C between 339 and 341" +2021,alley_north,569,whib,2021-03-09,,,,"3/23 new" +2021,alley_north,569,whib,2021-03-16,,,,"3/23 new" +2021,alley_north,569,whib,2021-03-23,2,,,"3/23 new" +2021,alley_north,569,whib,2021-03-30,,2,,"3/23 new" +2021,alley_north,569,whib,2021-04-06,,2,,"3/23 new" +2021,alley_north,569,whib,2021-04-14,,2,,"3/23 new" +2021,alley_north,569,whib,2021-04-20,,0,fledged,"3/23 new" +2021,alley_north,569,whib,2021-04-27,,,,"3/23 new" +2021,alley_north,461,whib,2021-03-09,2,,,"4/20 nest pulled, nest gone (chicks hanging above flagging)" +2021,alley_north,461,whib,2021-03-16,2,,,"4/20 nest pulled, nest gone (chicks hanging above flagging)" +2021,alley_north,461,whib,2021-03-23,2,,,"4/20 nest pulled, nest gone (chicks hanging above flagging)" +2021,alley_north,461,whib,2021-03-30,,2,,"4/20 nest pulled, nest gone (chicks hanging above flagging)" +2021,alley_north,461,whib,2021-04-06,,2,,"4/20 nest pulled, nest gone (chicks hanging above flagging)" +2021,alley_north,461,whib,2021-04-14,,2,,"4/20 nest pulled, nest gone (chicks hanging above flagging)" +2021,alley_north,461,whib,2021-04-20,,2,,"4/20 nest pulled, nest gone (chicks hanging above flagging)" +2021,alley_north,461,whib,2021-04-27,,,,"4/20 nest pulled, nest gone (chicks hanging above flagging)" +2021,alley_north,343,rosp,2021-03-09,2,,,"4/6 ROSP chicks 4/14 also ROSP--could have been rosp the whole time though initially marked as WHIB" +2021,alley_north,343,rosp,2021-03-16,2,,,"4/6 ROSP chicks 4/14 also ROSP--could have been rosp the whole time though initially marked as WHIB" +2021,alley_north,343,rosp,2021-03-23,,2,,"4/6 ROSP chicks 4/14 also ROSP--could have been rosp the whole time though initially marked as WHIB" +2021,alley_north,343,rosp,2021-03-30,,2,,"4/6 ROSP chicks 4/14 also ROSP--could have been rosp the whole time though initially marked as WHIB" +2021,alley_north,343,rosp,2021-04-06,,2,,"4/6 ROSP chicks 4/14 also ROSP--could have been rosp the whole time though initially marked as WHIB" +2021,alley_north,343,rosp,2021-04-14,,2,,"4/6 ROSP chicks 4/14 also ROSP--could have been rosp the whole time though initially marked as WHIB" +2021,alley_north,343,rosp,2021-04-20,,2,,"4/6 ROSP chicks 4/14 also ROSP--could have been rosp the whole time though initially marked as WHIB" +2021,alley_north,343,rosp,2021-04-27,,0,fledged,"4/6 ROSP chicks 4/14 also ROSP--could have been rosp the whole time though initially marked as WHIB" +2021,alley_north,345,whib,2021-03-09,2,,, +2021,alley_north,345,whib,2021-03-16,2,,, +2021,alley_north,345,whib,2021-03-23,2,,, +2021,alley_north,345,whib,2021-03-30,,2,, +2021,alley_north,345,whib,2021-04-06,,2,, +2021,alley_north,345,whib,2021-04-14,,2,, +2021,alley_north,345,whib,2021-04-20,,0,fledged, +2021,alley_north,345,whib,2021-04-27,,,, +2021,alley_north,347,whib,2021-03-09,2,,, +2021,alley_north,347,whib,2021-03-16,2,,, +2021,alley_north,347,whib,2021-03-23,2,,, +2021,alley_north,347,whib,2021-03-30,,2,, +2021,alley_north,347,whib,2021-04-06,,2,, +2021,alley_north,347,whib,2021-04-14,,2,, +2021,alley_north,347,whib,2021-04-20,,0,fledged, +2021,alley_north,347,whib,2021-04-27,,,, +2021,alley_north,349,whib,2021-03-09,2,,, +2021,alley_north,349,whib,2021-03-16,2,,, +2021,alley_north,349,whib,2021-03-23,2,,, +2021,alley_north,349,whib,2021-03-30,,2,, +2021,alley_north,349,whib,2021-04-06,,2,, +2021,alley_north,349,whib,2021-04-14,,3,, +2021,alley_north,349,whib,2021-04-20,,0,fledged, +2021,alley_north,349,whib,2021-04-27,,,, +2021,alley_north,351,greg,2021-03-09,3,,,"4/20 mercury" +2021,alley_north,351,greg,2021-03-16,3,,,"4/20 mercury" +2021,alley_north,351,greg,2021-03-23,,3,,"4/20 mercury" +2021,alley_north,351,greg,2021-03-30,,3,,"4/20 mercury" +2021,alley_north,351,greg,2021-04-06,,3,,"4/20 mercury" +2021,alley_north,351,greg,2021-04-14,,3,,"4/20 mercury" +2021,alley_north,351,greg,2021-04-20,,3,,"4/20 mercury" +2021,alley_north,351,greg,2021-04-27,,0,fledged,"4/20 mercury" +2021,alley_north,432,whib,2021-03-09,2,,, +2021,alley_north,432,whib,2021-03-16,2,,, +2021,alley_north,432,whib,2021-03-23,2,,, +2021,alley_north,432,whib,2021-03-30,,2,, +2021,alley_north,432,whib,2021-04-06,,2,, +2021,alley_north,432,whib,2021-04-14,,2,, +2021,alley_north,432,whib,2021-04-20,,0,fledged, +2021,alley_north,432,whib,2021-04-27,,,, +2021,alley_north,434,whib,2021-03-09,2,,, +2021,alley_north,434,whib,2021-03-16,2,,, +2021,alley_north,434,whib,2021-03-23,2,,, +2021,alley_north,434,whib,2021-03-30,,2,, +2021,alley_north,434,whib,2021-04-06,,2,, +2021,alley_north,434,whib,2021-04-14,,2,, +2021,alley_north,434,whib,2021-04-20,,0,fledged, +2021,alley_north,434,whib,2021-04-27,,,, +2021,alley_north,322,whib,2021-03-09,,,, +2021,alley_north,322,whib,2021-03-16,3,,, +2021,alley_north,322,whib,2021-03-23,3,,, +2021,alley_north,322,whib,2021-03-30,,2,, +2021,alley_north,322,whib,2021-04-06,,2,, +2021,alley_north,322,whib,2021-04-14,,0,empty, +2021,alley_north,322,whib,2021-04-20,,,, +2021,alley_north,322,whib,2021-04-27,,,, +2021,alley_north,463,greg,2021-03-09,3,,, +2021,alley_north,463,greg,2021-03-16,3,,, +2021,alley_north,463,greg,2021-03-23,0,,empty, +2021,alley_north,463,greg,2021-03-30,,,, +2021,alley_north,463,greg,2021-04-06,,,, +2021,alley_north,463,greg,2021-04-14,,,, +2021,alley_north,463,greg,2021-04-20,,,, +2021,alley_north,463,greg,2021-04-27,,,, +2021,alley_north,465,greg,2021-03-09,2,,,"3/30 collapsed" +2021,alley_north,465,greg,2021-03-16,0,,empty,"3/30 collapsed" +2021,alley_north,465,greg,2021-03-23,,,,"3/30 collapsed" +2021,alley_north,465,greg,2021-03-30,,,,"3/30 collapsed" +2021,alley_north,465,greg,2021-04-06,,,,"3/30 collapsed" +2021,alley_north,465,greg,2021-04-14,,,,"3/30 collapsed" +2021,alley_north,465,greg,2021-04-20,,,,"3/30 collapsed" +2021,alley_north,465,greg,2021-04-27,,,,"3/30 collapsed" +2021,alley_north,467,greg,2021-03-09,3,,,"4/27 mercury" +2021,alley_north,467,greg,2021-03-16,3,,,"4/27 mercury" +2021,alley_north,467,greg,2021-03-23,3,,,"4/27 mercury" +2021,alley_north,467,greg,2021-03-30,3,,,"4/27 mercury" +2021,alley_north,467,greg,2021-04-06,,2,,"4/27 mercury" +2021,alley_north,467,greg,2021-04-14,1,2,,"4/27 mercury" +2021,alley_north,467,greg,2021-04-20,1,1,,"4/27 mercury" +2021,alley_north,467,greg,2021-04-27,,1,,"4/27 mercury" +2021,alley_north,553,whib,2021-03-09,,,,"4/14 egg is dead" +2021,alley_north,553,whib,2021-03-16,2,,,"4/14 egg is dead" +2021,alley_north,553,whib,2021-03-23,2,,,"4/14 egg is dead" +2021,alley_north,553,whib,2021-03-30,1,1,,"4/14 egg is dead" +2021,alley_north,553,whib,2021-04-06,1,1,,"4/14 egg is dead" +2021,alley_north,553,whib,2021-04-14,1,1,,"4/14 egg is dead" +2021,alley_north,553,whib,2021-04-20,1,,,"4/14 egg is dead" +2021,alley_north,553,whib,2021-04-27,,0,fledged,"4/14 egg is dead" +2021,alley_north,353,whib,2021-03-09,3,,, +2021,alley_north,353,whib,2021-03-16,3,,, +2021,alley_north,353,whib,2021-03-23,3,,, +2021,alley_north,353,whib,2021-03-30,,3,, +2021,alley_north,353,whib,2021-04-06,,2,, +2021,alley_north,353,whib,2021-04-14,,2,, +2021,alley_north,353,whib,2021-04-20,,2,, +2021,alley_north,353,whib,2021-04-27,,0,fledged, +2021,alley_north,555,whib,2021-03-09,,,,"4/20 nest pulled" +2021,alley_north,555,whib,2021-03-16,2,,,"4/20 nest pulled" +2021,alley_north,555,whib,2021-03-23,2,,,"4/20 nest pulled" +2021,alley_north,555,whib,2021-03-30,,2,,"4/20 nest pulled" +2021,alley_north,555,whib,2021-04-06,,2,,"4/20 nest pulled" +2021,alley_north,555,whib,2021-04-14,,,missed,"4/20 nest pulled" +2021,alley_north,555,whib,2021-04-20,,0,empty,"4/20 nest pulled" +2021,alley_north,555,whib,2021-04-27,,,,"4/20 nest pulled" +2021,alley_north,436,whib,2021-03-09,2,,,"3/30 dead eggs, 4/20 nest pulled" +2021,alley_north,436,whib,2021-03-16,2,,,"3/30 dead eggs, 4/20 nest pulled" +2021,alley_north,436,whib,2021-03-23,0,,empty,"3/30 dead eggs, 4/20 nest pulled" +2021,alley_north,436,whib,2021-03-30,,,,"3/30 dead eggs, 4/20 nest pulled" +2021,alley_north,436,whib,2021-04-06,,,,"3/30 dead eggs, 4/20 nest pulled" +2021,alley_north,436,whib,2021-04-14,,,,"3/30 dead eggs, 4/20 nest pulled" +2021,alley_north,436,whib,2021-04-20,,0,empty,"3/30 dead eggs, 4/20 nest pulled" +2021,alley_north,436,whib,2021-04-27,,,,"3/30 dead eggs, 4/20 nest pulled" +2021,alley_north,438,whib,2021-03-09,2,,,"3/16 appeared to be collapsing" +2021,alley_north,438,whib,2021-03-16,0,,empty,"3/16 appeared to be collapsing" +2021,alley_north,438,whib,2021-03-23,,,,"3/16 appeared to be collapsing" +2021,alley_north,438,whib,2021-03-30,,,,"3/16 appeared to be collapsing" +2021,alley_north,438,whib,2021-04-06,,,,"3/16 appeared to be collapsing" +2021,alley_north,438,whib,2021-04-14,,,,"3/16 appeared to be collapsing" +2021,alley_north,438,whib,2021-04-20,,,,"3/16 appeared to be collapsing" +2021,alley_north,438,whib,2021-04-27,,,,"3/16 appeared to be collapsing" +2021,alley_north,440,whib,2021-03-09,2,,,"4/14 3 C between 440 and 444" +2021,alley_north,440,whib,2021-03-16,2,,,"4/14 3 C between 440 and 444" +2021,alley_north,440,whib,2021-03-23,2,,,"4/14 3 C between 440 and 444" +2021,alley_north,440,whib,2021-03-30,,2,,"4/14 3 C between 440 and 444" +2021,alley_north,440,whib,2021-04-06,,2,,"4/14 3 C between 440 and 444" +2021,alley_north,440,whib,2021-04-14,,1,,"4/14 3 C between 440 and 444" +2021,alley_north,440,whib,2021-04-20,,0,fledged,"4/14 3 C between 440 and 444" +2021,alley_north,440,whib,2021-04-27,,,,"4/14 3 C between 440 and 444" +2021,alley_north,442,whib,2021-03-09,1,,,"3/16 collapsed" +2021,alley_north,442,whib,2021-03-16,0,,empty,"3/16 collapsed" +2021,alley_north,442,whib,2021-03-23,,,,"3/16 collapsed" +2021,alley_north,442,whib,2021-03-30,,,,"3/16 collapsed" +2021,alley_north,442,whib,2021-04-06,,,,"3/16 collapsed" +2021,alley_north,442,whib,2021-04-14,,,,"3/16 collapsed" +2021,alley_north,442,whib,2021-04-20,,,,"3/16 collapsed" +2021,alley_north,442,whib,2021-04-27,,,,"3/16 collapsed" +2021,alley_north,444,whib,2021-03-09,2,,,"4/14 3 C between 440 and 444" +2021,alley_north,444,whib,2021-03-16,2,,,"4/14 3 C between 440 and 444" +2021,alley_north,444,whib,2021-03-23,2,,,"4/14 3 C between 440 and 444" +2021,alley_north,444,whib,2021-03-30,,2,,"4/14 3 C between 440 and 444" +2021,alley_north,444,whib,2021-04-06,,2,,"4/14 3 C between 440 and 444" +2021,alley_north,444,whib,2021-04-14,,2,,"4/14 3 C between 440 and 444" +2021,alley_north,444,whib,2021-04-20,,0,fledged,"4/14 3 C between 440 and 444" +2021,alley_north,444,whib,2021-04-27,,,,"4/14 3 C between 440 and 444" +2021,alley_north,355,greg,2021-03-09,3,,, +2021,alley_north,355,greg,2021-03-16,0,,empty, +2021,alley_north,355,greg,2021-03-23,,,, +2021,alley_north,355,greg,2021-03-30,,,, +2021,alley_north,355,greg,2021-04-06,,,, +2021,alley_north,355,greg,2021-04-14,,,, +2021,alley_north,355,greg,2021-04-20,,,, +2021,alley_north,355,greg,2021-04-27,,,, +2021,alley_north,469,whib,2021-03-09,2,,,"4/14 1 dead chick" +2021,alley_north,469,whib,2021-03-16,3,,,"4/14 1 dead chick" +2021,alley_north,469,whib,2021-03-23,3,,,"4/14 1 dead chick" +2021,alley_north,469,whib,2021-03-30,1,2,,"4/14 1 dead chick" +2021,alley_north,469,whib,2021-04-06,,3,,"4/14 1 dead chick" +2021,alley_north,469,whib,2021-04-14,,1,,"4/14 1 dead chick" +2021,alley_north,469,whib,2021-04-20,,0,fledged,"4/14 1 dead chick" +2021,alley_north,469,whib,2021-04-27,,,,"4/14 1 dead chick" +2021,alley_north,471,whib,2021-03-09,3,,, +2021,alley_north,471,whib,2021-03-16,3,,, +2021,alley_north,471,whib,2021-03-23,2,,, +2021,alley_north,471,whib,2021-03-30,,3,, +2021,alley_north,471,whib,2021-04-06,,1,, +2021,alley_north,471,whib,2021-04-14,,1,, +2021,alley_north,471,whib,2021-04-20,,0,fledged, +2021,alley_north,471,whib,2021-04-27,,,, +2021,alley_north,473,whib,2021-03-09,2,,, +2021,alley_north,473,whib,2021-03-16,2,,, +2021,alley_north,473,whib,2021-03-23,2,,, +2021,alley_north,473,whib,2021-03-30,,2,, +2021,alley_north,473,whib,2021-04-06,,2,, +2021,alley_north,473,whib,2021-04-14,,2,, +2021,alley_north,473,whib,2021-04-20,,0,fledged, +2021,alley_north,473,whib,2021-04-27,,,, +2021,alley_north,475,whib,2021-03-09,2,,, +2021,alley_north,475,whib,2021-03-16,2,,, +2021,alley_north,475,whib,2021-03-23,2,,, +2021,alley_north,475,whib,2021-03-30,,2,, +2021,alley_north,475,whib,2021-04-06,,2,, +2021,alley_north,475,whib,2021-04-14,,2,, +2021,alley_north,475,whib,2021-04-20,,0,fledged, +2021,alley_north,475,whib,2021-04-27,,,, +2021,alley_north,357,whib,2021-03-09,1,,, +2021,alley_north,357,whib,2021-03-16,2,,, +2021,alley_north,357,whib,2021-03-23,2,,, +2021,alley_north,357,whib,2021-03-30,1,1,, +2021,alley_north,357,whib,2021-04-06,,2,, +2021,alley_north,357,whib,2021-04-14,,2,, +2021,alley_north,357,whib,2021-04-20,,0,fledged, +2021,alley_north,357,whib,2021-04-27,,,, +2021,alley_north,359,whib,2021-03-09,2,,, +2021,alley_north,359,whib,2021-03-16,2,,, +2021,alley_north,359,whib,2021-03-23,2,,, +2021,alley_north,359,whib,2021-03-30,,2,, +2021,alley_north,359,whib,2021-04-06,,2,, +2021,alley_north,359,whib,2021-04-14,,2,, +2021,alley_north,359,whib,2021-04-20,,0,fledged, +2021,alley_north,359,whib,2021-04-27,,,, +2021,alley_north,361,whib,2021-03-09,2,,, +2021,alley_north,361,whib,2021-03-16,3,,, +2021,alley_north,361,whib,2021-03-23,3,,, +2021,alley_north,361,whib,2021-03-30,,3,, +2021,alley_north,361,whib,2021-04-06,,3,, +2021,alley_north,361,whib,2021-04-14,,2,, +2021,alley_north,361,whib,2021-04-20,,0,fledged, +2021,alley_north,361,whib,2021-04-27,,,, +2021,alley_north,477,rosp,2021-03-09,1,3,, +2021,alley_north,477,rosp,2021-03-16,,4,, +2021,alley_north,477,rosp,2021-03-23,,4,, +2021,alley_north,477,rosp,2021-03-30,,3,, +2021,alley_north,477,rosp,2021-04-06,,3,, +2021,alley_north,477,rosp,2021-04-14,,2,, +2021,alley_north,477,rosp,2021-04-20,,0,fledged, +2021,alley_north,477,rosp,2021-04-27,,,, +2021,alley_north,446,whib,2021-03-09,2,,, +2021,alley_north,446,whib,2021-03-16,1,,, +2021,alley_north,446,whib,2021-03-23,0,,empty, +2021,alley_north,446,whib,2021-03-30,,,, +2021,alley_north,446,whib,2021-04-06,,,, +2021,alley_north,446,whib,2021-04-14,,,, +2021,alley_north,446,whib,2021-04-20,,,, +2021,alley_north,446,whib,2021-04-27,,,, +2021,alley_north,448,whib,2021-03-09,2,,, +2021,alley_north,448,whib,2021-03-16,2,,, +2021,alley_north,448,whib,2021-03-23,2,,, +2021,alley_north,448,whib,2021-03-30,,2,, +2021,alley_north,448,whib,2021-04-06,,2,, +2021,alley_north,448,whib,2021-04-14,,2,, +2021,alley_north,448,whib,2021-04-20,,0,fledged, +2021,alley_north,448,whib,2021-04-27,,,, +2021,alley_north,450,whib,2021-03-09,1,,, +2021,alley_north,450,whib,2021-03-16,1,,, +2021,alley_north,450,whib,2021-03-23,1,,, +2021,alley_north,450,whib,2021-03-30,,1,, +2021,alley_north,450,whib,2021-04-06,,1,, +2021,alley_north,450,whib,2021-04-14,,1,, +2021,alley_north,450,whib,2021-04-20,,0,fledged, +2021,alley_north,450,whib,2021-04-27,,,, +2021,alley_north,452,whib,2021-03-09,1,,,"3/30 collapsed" +2021,alley_north,452,whib,2021-03-16,2,,,"3/30 collapsed" +2021,alley_north,452,whib,2021-03-23,0,,empty,"3/30 collapsed" +2021,alley_north,452,whib,2021-03-30,,,,"3/30 collapsed" +2021,alley_north,452,whib,2021-04-06,,,,"3/30 collapsed" +2021,alley_north,452,whib,2021-04-14,,,,"3/30 collapsed" +2021,alley_north,452,whib,2021-04-20,,,,"3/30 collapsed" +2021,alley_north,452,whib,2021-04-27,,,,"3/30 collapsed" +2021,alley_north,479,greg,2021-03-09,2,,,"4/20 mercury" +2021,alley_north,479,greg,2021-03-16,2,,,"4/20 mercury" +2021,alley_north,479,greg,2021-03-23,,2,,"4/20 mercury" +2021,alley_north,479,greg,2021-03-30,,2,,"4/20 mercury" +2021,alley_north,479,greg,2021-04-06,,2,,"4/20 mercury" +2021,alley_north,479,greg,2021-04-14,,2,,"4/20 mercury" +2021,alley_north,479,greg,2021-04-20,,2,,"4/20 mercury" +2021,alley_north,479,greg,2021-04-27,,3,fledged,"4/20 mercury" +2021,alley_north,363,whib,2021-03-09,1,,, +2021,alley_north,363,whib,2021-03-16,0,,empty, +2021,alley_north,363,whib,2021-03-23,,,, +2021,alley_north,363,whib,2021-03-30,,,, +2021,alley_north,363,whib,2021-04-06,,,, +2021,alley_north,363,whib,2021-04-14,,,, +2021,alley_north,363,whib,2021-04-20,,,, +2021,alley_north,363,whib,2021-04-27,,,, +2021,alley_north,365,whib,2021-03-09,1,,, +2021,alley_north,365,whib,2021-03-16,2,,, +2021,alley_north,365,whib,2021-03-23,2,,, +2021,alley_north,365,whib,2021-03-30,2,,, +2021,alley_north,365,whib,2021-04-06,1,,, +2021,alley_north,365,whib,2021-04-14,,1,, +2021,alley_north,365,whib,2021-04-20,,0,fledged, +2021,alley_north,365,whib,2021-04-27,,0,fledged, +2021,alley_north,367,whib,2021-03-09,1,,, +2021,alley_north,367,whib,2021-03-16,2,,, +2021,alley_north,367,whib,2021-03-23,2,,, +2021,alley_north,367,whib,2021-03-30,2,,, +2021,alley_north,367,whib,2021-04-06,1,1,, +2021,alley_north,367,whib,2021-04-14,1,,, +2021,alley_north,367,whib,2021-04-20,,0,empty, +2021,alley_north,367,whib,2021-04-27,,0,fledged, +2021,alley_north,481,whib,2021-03-09,2,,, +2021,alley_north,481,whib,2021-03-16,2,,, +2021,alley_north,481,whib,2021-03-23,2,,, +2021,alley_north,481,whib,2021-03-30,1,1,, +2021,alley_north,481,whib,2021-04-06,,2,, +2021,alley_north,481,whib,2021-04-14,,2,, +2021,alley_north,481,whib,2021-04-20,,0,fledged, +2021,alley_north,481,whib,2021-04-27,,,, +2021,alley_north,483,whib,2021-03-09,3,,, +2021,alley_north,483,whib,2021-03-16,3,,, +2021,alley_north,483,whib,2021-03-23,3,,, +2021,alley_north,483,whib,2021-03-30,,3,, +2021,alley_north,483,whib,2021-04-06,,2,, +2021,alley_north,483,whib,2021-04-14,,1,, +2021,alley_north,483,whib,2021-04-20,,0,fledged, +2021,alley_north,483,whib,2021-04-27,,,, +2021,alley_north,485,whib,2021-03-09,2,,,"3/16 eggshells in nest, appears predated" +2021,alley_north,485,whib,2021-03-16,0,,empty,"3/16 eggshells in nest, appears predated" +2021,alley_north,485,whib,2021-03-23,,,,"3/16 eggshells in nest, appears predated" +2021,alley_north,485,whib,2021-03-30,,,,"3/16 eggshells in nest, appears predated" +2021,alley_north,485,whib,2021-04-06,,,,"3/16 eggshells in nest, appears predated" +2021,alley_north,485,whib,2021-04-14,,,,"3/16 eggshells in nest, appears predated" +2021,alley_north,485,whib,2021-04-20,,,,"3/16 eggshells in nest, appears predated" +2021,alley_north,485,whib,2021-04-27,,,,"3/16 eggshells in nest, appears predated" +2021,alley_north,487,whib,2021-03-09,3,,, +2021,alley_north,487,whib,2021-03-16,3,,, +2021,alley_north,487,whib,2021-03-23,3,,, +2021,alley_north,487,whib,2021-03-30,,3,, +2021,alley_north,487,whib,2021-04-06,,2,, +2021,alley_north,487,whib,2021-04-14,,1,, +2021,alley_north,487,whib,2021-04-20,,0,fledged, +2021,alley_north,487,whib,2021-04-27,,,, +2021,alley_north,369,whib,2021-03-09,2,,, +2021,alley_north,369,whib,2021-03-16,2,,, +2021,alley_north,369,whib,2021-03-23,2,,, +2021,alley_north,369,whib,2021-03-30,,2,, +2021,alley_north,369,whib,2021-04-06,,2,, +2021,alley_north,369,whib,2021-04-14,,2,, +2021,alley_north,369,whib,2021-04-20,,0,fledged, +2021,alley_north,369,whib,2021-04-27,,,, +2021,alley_north,371,whib,2021-03-09,1,,, +2021,alley_north,371,whib,2021-03-16,2,,, +2021,alley_north,371,whib,2021-03-23,2,,, +2021,alley_north,371,whib,2021-03-30,2,,, +2021,alley_north,371,whib,2021-04-06,2,,, +2021,alley_north,371,whib,2021-04-14,0,,empty, +2021,alley_north,371,whib,2021-04-20,,,, +2021,alley_north,371,whib,2021-04-27,,,, +2021,alley_north,373,whib,2021-03-09,2,,, +2021,alley_north,373,whib,2021-03-16,1,,, +2021,alley_north,373,whib,2021-03-23,1,,, +2021,alley_north,373,whib,2021-03-30,1,,, +2021,alley_north,373,whib,2021-04-06,0,,empty, +2021,alley_north,373,whib,2021-04-14,,,, +2021,alley_north,373,whib,2021-04-20,,,, +2021,alley_north,373,whib,2021-04-27,,,, +2021,alley_north,375,whib,2021-03-09,2,,, +2021,alley_north,375,whib,2021-03-16,2,,, +2021,alley_north,375,whib,2021-03-23,2,,, +2021,alley_north,375,whib,2021-03-30,1,1,, +2021,alley_north,375,whib,2021-04-06,,1,, +2021,alley_north,375,whib,2021-04-14,,1,, +2021,alley_north,375,whib,2021-04-20,,0,fledged, +2021,alley_north,375,whib,2021-04-27,,,, +2021,alley_north,454,greg,2021-03-09,3,,, +2021,alley_north,454,greg,2021-03-16,3,,, +2021,alley_north,454,greg,2021-03-23,3,,, +2021,alley_north,454,greg,2021-03-30,1,,, +2021,alley_north,454,greg,2021-04-06,0,,empty, +2021,alley_north,454,greg,2021-04-14,,,, +2021,alley_north,454,greg,2021-04-20,,,, +2021,alley_north,454,greg,2021-04-27,,,, +2021,alley_north,735,smhe,2021-03-09,,,,"maybe greg" +2021,alley_north,735,smhe,2021-03-16,,,,"maybe greg" +2021,alley_north,735,smhe,2021-03-23,,,,"maybe greg" +2021,alley_north,735,smhe,2021-03-30,,,,"maybe greg" +2021,alley_north,735,smhe,2021-04-06,2,,,"maybe greg" +2021,alley_north,735,smhe,2021-04-14,2,,,"maybe greg" +2021,alley_north,735,smhe,2021-04-20,2,,,"maybe greg" +2021,alley_north,735,smhe,2021-04-27,,,missed,"maybe greg" +2021,alley_north,456,whib,2021-03-09,1,,,"3/16 appeared to be collapsing" +2021,alley_north,456,whib,2021-03-16,0,,empty,"3/16 appeared to be collapsing" +2021,alley_north,456,whib,2021-03-23,,,,"3/16 appeared to be collapsing" +2021,alley_north,456,whib,2021-03-30,,,,"3/16 appeared to be collapsing" +2021,alley_north,456,whib,2021-04-06,,,,"3/16 appeared to be collapsing" +2021,alley_north,456,whib,2021-04-14,,,,"3/16 appeared to be collapsing" +2021,alley_north,456,whib,2021-04-20,,,,"3/16 appeared to be collapsing" +2021,alley_north,456,whib,2021-04-27,,,,"3/16 appeared to be collapsing" +2021,alley_north,489,trhe,2021-03-09,2,,,"4/27 tricolored chicks" +2021,alley_north,489,trhe,2021-03-16,1,,,"4/27 tricolored chicks" +2021,alley_north,489,trhe,2021-03-23,1,,,"4/27 tricolored chicks" +2021,alley_north,489,trhe,2021-03-30,1,,,"4/27 tricolored chicks" +2021,alley_north,489,trhe,2021-04-06,3,,,"4/27 tricolored chicks" +2021,alley_north,489,trhe,2021-04-14,3,,,"4/27 tricolored chicks" +2021,alley_north,489,trhe,2021-04-20,3,,,"4/27 tricolored chicks" +2021,alley_north,489,trhe,2021-04-27,,2,,"4/27 tricolored chicks" +2021,alley_north,491,whib,2021-03-09,2,,,"4/20 nest pulled" +2021,alley_north,491,whib,2021-03-16,3,,,"4/20 nest pulled" +2021,alley_north,491,whib,2021-03-23,3,,,"4/20 nest pulled" +2021,alley_north,491,whib,2021-03-30,2,1,pipping,"4/20 nest pulled" +2021,alley_north,491,whib,2021-04-06,0,0,empty,"4/20 nest pulled" +2021,alley_north,491,whib,2021-04-14,,,,"4/20 nest pulled" +2021,alley_north,491,whib,2021-04-20,,,,"4/20 nest pulled" +2021,alley_north,491,whib,2021-04-27,,,,"4/20 nest pulled" +2021,alley_north,524,whib,2021-03-09,,,, +2021,alley_north,524,whib,2021-03-16,1,,, +2021,alley_north,524,whib,2021-03-23,1,,, +2021,alley_north,524,whib,2021-03-30,,1,, +2021,alley_north,524,whib,2021-04-06,,1,, +2021,alley_north,524,whib,2021-04-14,,1,, +2021,alley_north,524,whib,2021-04-20,,0,fledged, +2021,alley_north,524,whib,2021-04-27,,,, +2021,alley_north,458,gbhe,2021-03-09,4,,,"4/14 2+ chicks" +2021,alley_north,458,gbhe,2021-03-16,1,1,,"4/14 2+ chicks" +2021,alley_north,458,gbhe,2021-03-23,,2,,"4/14 2+ chicks" +2021,alley_north,458,gbhe,2021-03-30,,1,,"4/14 2+ chicks" +2021,alley_north,458,gbhe,2021-04-06,,1,,"4/14 2+ chicks" +2021,alley_north,458,gbhe,2021-04-14,,2,,"4/14 2+ chicks" +2021,alley_north,458,gbhe,2021-04-20,,2,,"4/14 2+ chicks" +2021,alley_north,458,gbhe,2021-04-27,,0,fledged,"4/14 2+ chicks" +2021,alley_north,493,whib,2021-03-09,1,,,"3/16 collapsed" +2021,alley_north,493,whib,2021-03-16,0,,empty,"3/16 collapsed" +2021,alley_north,493,whib,2021-03-23,,,,"3/16 collapsed" +2021,alley_north,493,whib,2021-03-30,,,,"3/16 collapsed" +2021,alley_north,493,whib,2021-04-06,,,,"3/16 collapsed" +2021,alley_north,493,whib,2021-04-14,,,,"3/16 collapsed" +2021,alley_north,493,whib,2021-04-20,,,,"3/16 collapsed" +2021,alley_north,493,whib,2021-04-27,,,,"3/16 collapsed" +2021,alley_north,495,whib,2021-03-09,1,,, +2021,alley_north,495,whib,2021-03-16,2,,, +2021,alley_north,495,whib,2021-03-23,2,,, +2021,alley_north,495,whib,2021-03-30,1,1,wet_chick, +2021,alley_north,495,whib,2021-04-06,,2,, +2021,alley_north,495,whib,2021-04-14,,2,, +2021,alley_north,495,whib,2021-04-20,,0,fledged, +2021,alley_north,495,whib,2021-04-27,,,, +2021,alley_north,497,whib,2021-03-09,1,,, +2021,alley_north,497,whib,2021-03-16,2,,, +2021,alley_north,497,whib,2021-03-23,0,,empty, +2021,alley_north,497,whib,2021-03-30,,,, +2021,alley_north,497,whib,2021-04-06,,,, +2021,alley_north,497,whib,2021-04-14,,,, +2021,alley_north,497,whib,2021-04-20,,,, +2021,alley_north,497,whib,2021-04-27,,,, +2021,alley_north,499,whib,2021-03-09,1,,, +2021,alley_north,499,whib,2021-03-16,1,,, +2021,alley_north,499,whib,2021-03-23,1,,, +2021,alley_north,499,whib,2021-03-30,,1,, +2021,alley_north,499,whib,2021-04-06,,1,, +2021,alley_north,499,whib,2021-04-14,,1,, +2021,alley_north,499,whib,2021-04-20,,0,fledged, +2021,alley_north,499,whib,2021-04-27,,,, +2021,alley_north,377,whib,2021-03-09,2,,, +2021,alley_north,377,whib,2021-03-16,2,,, +2021,alley_north,377,whib,2021-03-23,2,,, +2021,alley_north,377,whib,2021-03-30,,2,, +2021,alley_north,377,whib,2021-04-06,,2,, +2021,alley_north,377,whib,2021-04-14,,2,, +2021,alley_north,377,whib,2021-04-20,,0,fledged, +2021,alley_north,377,whib,2021-04-27,,,, +2021,alley_north,379,whib,2021-03-09,2,,, +2021,alley_north,379,whib,2021-03-16,2,,, +2021,alley_north,379,whib,2021-03-23,2,,, +2021,alley_north,379,whib,2021-03-30,1,1,, +2021,alley_north,379,whib,2021-04-06,,2,, +2021,alley_north,379,whib,2021-04-14,,2,, +2021,alley_north,379,whib,2021-04-20,,0,fledged, +2021,alley_north,379,whib,2021-04-27,,,, +2021,alley_north,381,whib,2021-03-09,1,,, +2021,alley_north,381,whib,2021-03-16,2,,, +2021,alley_north,381,whib,2021-03-23,2,,, +2021,alley_north,381,whib,2021-03-30,1,1,pipping, +2021,alley_north,381,whib,2021-04-06,,2,, +2021,alley_north,381,whib,2021-04-14,,2,, +2021,alley_north,381,whib,2021-04-20,,1,, +2021,alley_north,381,whib,2021-04-27,,0,fledged, +2021,alley_north,383,whib,2021-03-09,2,,, +2021,alley_north,383,whib,2021-03-16,2,,, +2021,alley_north,383,whib,2021-03-23,2,,, +2021,alley_north,383,whib,2021-03-30,1,1,, +2021,alley_north,383,whib,2021-04-06,1,1,, +2021,alley_north,383,whib,2021-04-14,,1,, +2021,alley_north,383,whib,2021-04-20,,0,fledged, +2021,alley_north,383,whib,2021-04-27,,,, +2021,alley_north,460,whib,2021-03-09,2,,, +2021,alley_north,460,whib,2021-03-16,2,,, +2021,alley_north,460,whib,2021-03-23,2,,, +2021,alley_north,460,whib,2021-03-30,2,,, +2021,alley_north,460,whib,2021-04-06,2,,, +2021,alley_north,460,whib,2021-04-14,2,,, +2021,alley_north,460,whib,2021-04-20,1,,, +2021,alley_north,460,whib,2021-04-27,1,,, +2021,alley_north,462,whib,2021-03-09,3,,, +2021,alley_north,462,whib,2021-03-16,3,,, +2021,alley_north,462,whib,2021-03-23,3,,, +2021,alley_north,462,whib,2021-03-30,,4,, +2021,alley_north,462,whib,2021-04-06,,3,, +2021,alley_north,462,whib,2021-04-14,,2,, +2021,alley_north,462,whib,2021-04-20,,0,fledged, +2021,alley_north,462,whib,2021-04-27,,,, +2021,alley_north,526,rosp,2021-03-09,,,, +2021,alley_north,526,rosp,2021-03-16,2,,, +2021,alley_north,526,rosp,2021-03-23,2,,, +2021,alley_north,526,rosp,2021-03-30,,2,, +2021,alley_north,526,rosp,2021-04-06,,2,, +2021,alley_north,526,rosp,2021-04-14,,2,, +2021,alley_north,526,rosp,2021-04-20,,0,fledged, +2021,alley_north,526,rosp,2021-04-27,,,, +2021,alley_north,385,whib,2021-03-09,2,,, +2021,alley_north,385,whib,2021-03-16,2,,, +2021,alley_north,385,whib,2021-03-23,2,,, +2021,alley_north,385,whib,2021-03-30,,2,, +2021,alley_north,385,whib,2021-04-06,,2,, +2021,alley_north,385,whib,2021-04-14,,2,, +2021,alley_north,385,whib,2021-04-20,,0,fledged, +2021,alley_north,385,whib,2021-04-27,,,, +2021,alley_north,387,whib,2021-03-09,2,,, +2021,alley_north,387,whib,2021-03-16,2,,, +2021,alley_north,387,whib,2021-03-23,2,,, +2021,alley_north,387,whib,2021-03-30,,2,, +2021,alley_north,387,whib,2021-04-06,,2,, +2021,alley_north,387,whib,2021-04-14,,2,, +2021,alley_north,387,whib,2021-04-20,,0,fledged, +2021,alley_north,387,whib,2021-04-27,,,, +2021,alley_north,389,whib,2021-03-09,2,,, +2021,alley_north,389,whib,2021-03-16,2,,, +2021,alley_north,389,whib,2021-03-23,2,,, +2021,alley_north,389,whib,2021-03-30,,2,, +2021,alley_north,389,whib,2021-04-06,,2,, +2021,alley_north,389,whib,2021-04-14,,2,, +2021,alley_north,389,whib,2021-04-20,,0,fledged, +2021,alley_north,389,whib,2021-04-27,,,, +2021,alley_north,324,whib,2021-03-09,,,, +2021,alley_north,324,whib,2021-03-16,2,,, +2021,alley_north,324,whib,2021-03-23,2,,, +2021,alley_north,324,whib,2021-03-30,,2,, +2021,alley_north,324,whib,2021-04-06,,2,, +2021,alley_north,324,whib,2021-04-14,,2,, +2021,alley_north,324,whib,2021-04-20,,0,fledged, +2021,alley_north,324,whib,2021-04-27,,,, +2021,alley_north,326,whib,2021-03-09,,,, +2021,alley_north,326,whib,2021-03-16,2,,, +2021,alley_north,326,whib,2021-03-23,2,,, +2021,alley_north,326,whib,2021-03-30,,2,, +2021,alley_north,326,whib,2021-04-06,,2,, +2021,alley_north,326,whib,2021-04-14,,2,, +2021,alley_north,326,whib,2021-04-20,,0,fledged, +2021,alley_north,326,whib,2021-04-27,,,, +2021,alley_north,328,whib,2021-03-09,,,, +2021,alley_north,328,whib,2021-03-16,3,,, +2021,alley_north,328,whib,2021-03-23,3,,, +2021,alley_north,328,whib,2021-03-30,1,2,, +2021,alley_north,328,whib,2021-04-06,,2,, +2021,alley_north,328,whib,2021-04-14,,2,, +2021,alley_north,328,whib,2021-04-20,,0,fledged, +2021,alley_north,328,whib,2021-04-27,,,, +2021,alley_north,501,whib,2021-03-09,2,,,"4/14 3 chicks between 501 and 503" +2021,alley_north,501,whib,2021-03-16,2,,,"4/14 3 chicks between 501 and 503" +2021,alley_north,501,whib,2021-03-23,2,,,"4/14 3 chicks between 501 and 503" +2021,alley_north,501,whib,2021-03-30,,2,,"4/14 3 chicks between 501 and 503" +2021,alley_north,501,whib,2021-04-06,,2,,"4/14 3 chicks between 501 and 503" +2021,alley_north,501,whib,2021-04-14,,2,,"4/14 3 chicks between 501 and 503" +2021,alley_north,501,whib,2021-04-20,,0,fledged,"4/14 3 chicks between 501 and 503" +2021,alley_north,501,whib,2021-04-27,,,,"4/14 3 chicks between 501 and 503" +2021,alley_north,503,whib,2021-03-09,2,,,"4/14 3 chicks between 501 and 503" +2021,alley_north,503,whib,2021-03-16,2,,,"4/14 3 chicks between 501 and 503" +2021,alley_north,503,whib,2021-03-23,2,,,"4/14 3 chicks between 501 and 503" +2021,alley_north,503,whib,2021-03-30,1,1,,"4/14 3 chicks between 501 and 503" +2021,alley_north,503,whib,2021-04-06,1,1,,"4/14 3 chicks between 501 and 503" +2021,alley_north,503,whib,2021-04-14,,1,,"4/14 3 chicks between 501 and 503" +2021,alley_north,503,whib,2021-04-20,,0,fledged,"4/14 3 chicks between 501 and 503" +2021,alley_north,503,whib,2021-04-27,,,,"4/14 3 chicks between 501 and 503" +2021,alley_north,505,whib,2021-03-09,2,,,"3/16 collapsed" +2021,alley_north,505,whib,2021-03-16,0,,empty,"3/16 collapsed" +2021,alley_north,505,whib,2021-03-23,,,,"3/16 collapsed" +2021,alley_north,505,whib,2021-03-30,,,,"3/16 collapsed" +2021,alley_north,505,whib,2021-04-06,,,,"3/16 collapsed" +2021,alley_north,505,whib,2021-04-14,,,,"3/16 collapsed" +2021,alley_north,505,whib,2021-04-20,,,,"3/16 collapsed" +2021,alley_north,505,whib,2021-04-27,,,,"3/16 collapsed" +2021,alley_north,464,whib,2021-03-09,1,,, +2021,alley_north,464,whib,2021-03-16,1,,, +2021,alley_north,464,whib,2021-03-23,0,,empty, +2021,alley_north,464,whib,2021-03-30,,,, +2021,alley_north,464,whib,2021-04-06,,,, +2021,alley_north,464,whib,2021-04-14,,,, +2021,alley_north,464,whib,2021-04-20,,0,fledged, +2021,alley_north,464,whib,2021-04-27,,,, +2021,alley_north,468,whib,2021-03-09,2,,, +2021,alley_north,468,whib,2021-03-16,2,,, +2021,alley_north,468,whib,2021-03-23,2,,, +2021,alley_north,468,whib,2021-03-30,,2,, +2021,alley_north,468,whib,2021-04-06,,2,, +2021,alley_north,468,whib,2021-04-14,,2,, +2021,alley_north,468,whib,2021-04-20,,0,fledged, +2021,alley_north,468,whib,2021-04-27,,,, +2021,alley_north,391,bcnh,2021-03-09,2,,,"3/16 collapsed--uncertain of species" +2021,alley_north,391,bcnh,2021-03-16,0,,empty,"3/16 collapsed--uncertain of species" +2021,alley_north,391,bcnh,2021-03-23,,,,"3/16 collapsed--uncertain of species" +2021,alley_north,391,bcnh,2021-03-30,,,,"3/16 collapsed--uncertain of species" +2021,alley_north,391,bcnh,2021-04-06,,,,"3/16 collapsed--uncertain of species" +2021,alley_north,391,bcnh,2021-04-14,,,,"3/16 collapsed--uncertain of species" +2021,alley_north,391,bcnh,2021-04-20,,,,"3/16 collapsed--uncertain of species" +2021,alley_north,391,bcnh,2021-04-27,,,,"3/16 collapsed--uncertain of species" +2021,alley_north,507,greg,2021-03-09,2,,, +2021,alley_north,507,greg,2021-03-16,2,,, +2021,alley_north,507,greg,2021-03-23,2,,, +2021,alley_north,507,greg,2021-03-30,0,,empty, +2021,alley_north,507,greg,2021-04-06,,,, +2021,alley_north,507,greg,2021-04-14,,,, +2021,alley_north,507,greg,2021-04-20,,,, +2021,alley_north,507,greg,2021-04-27,,,, +2021,alley_north,393,whib,2021-03-09,2,,,"4/14 4 chicks between 393 and 395" +2021,alley_north,393,whib,2021-03-16,3,,,"4/14 4 chicks between 393 and 395" +2021,alley_north,393,whib,2021-03-23,3,,,"4/14 4 chicks between 393 and 395" +2021,alley_north,393,whib,2021-03-30,1,2,,"4/14 4 chicks between 393 and 395" +2021,alley_north,393,whib,2021-04-06,,3,,"4/14 4 chicks between 393 and 395" +2021,alley_north,393,whib,2021-04-14,,2,,"4/14 4 chicks between 393 and 395" +2021,alley_north,393,whib,2021-04-20,,0,fledged,"4/14 4 chicks between 393 and 395" +2021,alley_north,393,whib,2021-04-27,,,,"4/14 4 chicks between 393 and 395" +2021,alley_north,395,whib,2021-03-09,3,,,"4/14 4 chicks between 393 and 395" +2021,alley_north,395,whib,2021-03-16,3,,,"4/14 4 chicks between 393 and 395" +2021,alley_north,395,whib,2021-03-23,3,,,"4/14 4 chicks between 393 and 395" +2021,alley_north,395,whib,2021-03-30,,3,,"4/14 4 chicks between 393 and 395" +2021,alley_north,395,whib,2021-04-06,,2,,"4/14 4 chicks between 393 and 395" +2021,alley_north,395,whib,2021-04-14,,2,,"4/14 4 chicks between 393 and 395" +2021,alley_north,395,whib,2021-04-20,,0,fledged,"4/14 4 chicks between 393 and 395" +2021,alley_north,395,whib,2021-04-27,,,,"4/14 4 chicks between 393 and 395" +2021,alley_north,509,whib,2021-03-09,2,,, +2021,alley_north,509,whib,2021-03-16,2,,, +2021,alley_north,509,whib,2021-03-23,2,,, +2021,alley_north,509,whib,2021-03-30,,2,, +2021,alley_north,509,whib,2021-04-06,,2,, +2021,alley_north,509,whib,2021-04-14,,2,, +2021,alley_north,509,whib,2021-04-20,,0,fledged, +2021,alley_north,509,whib,2021-04-27,,,, +2021,alley_north,511,bcnh,2021-03-09,1,,,"uncertain of species, 4/20 nest pulled" +2021,alley_north,511,bcnh,2021-03-16,2,,,"uncertain of species, 4/20 nest pulled" +2021,alley_north,511,bcnh,2021-03-23,2,,,"uncertain of species, 4/20 nest pulled" +2021,alley_north,511,bcnh,2021-03-30,1,1,,"uncertain of species, 4/20 nest pulled" +2021,alley_north,511,bcnh,2021-04-06,0,0,empty,"uncertain of species, 4/20 nest pulled" +2021,alley_north,511,bcnh,2021-04-14,,,,"uncertain of species, 4/20 nest pulled" +2021,alley_north,511,bcnh,2021-04-20,,,,"uncertain of species, 4/20 nest pulled" +2021,alley_north,511,bcnh,2021-04-27,,,,"uncertain of species, 4/20 nest pulled" +2021,alley_north,397,greg,2021-03-09,3,,,"above 395" +2021,alley_north,397,greg,2021-03-16,3,,,"above 395" +2021,alley_north,397,greg,2021-03-23,2,1,pipping,"above 395" +2021,alley_north,397,greg,2021-03-30,1,2,,"above 395" +2021,alley_north,397,greg,2021-04-06,0,0,empty,"above 395" +2021,alley_north,397,greg,2021-04-14,,,,"above 395" +2021,alley_north,397,greg,2021-04-20,,,,"above 395" +2021,alley_north,397,greg,2021-04-27,,,,"above 395" +2021,alley_north,470,greg,2021-03-09,3,,,"3/16 appeared to be collapsing" +2021,alley_north,470,greg,2021-03-16,0,,empty,"3/16 appeared to be collapsing" +2021,alley_north,470,greg,2021-03-23,,,,"3/16 appeared to be collapsing" +2021,alley_north,470,greg,2021-03-30,,,,"3/16 appeared to be collapsing" +2021,alley_north,470,greg,2021-04-06,,,,"3/16 appeared to be collapsing" +2021,alley_north,470,greg,2021-04-14,,,,"3/16 appeared to be collapsing" +2021,alley_north,470,greg,2021-04-20,,,,"3/16 appeared to be collapsing" +2021,alley_north,470,greg,2021-04-27,,,,"3/16 appeared to be collapsing" +2021,alley_north,528,whib,2021-03-09,,,,"4/14 2+ chicks between 528 and 530" +2021,alley_north,528,whib,2021-03-16,2,,,"4/14 2+ chicks between 528 and 530" +2021,alley_north,528,whib,2021-03-23,2,,,"4/14 2+ chicks between 528 and 530" +2021,alley_north,528,whib,2021-03-30,1,1,,"4/14 2+ chicks between 528 and 530" +2021,alley_north,528,whib,2021-04-06,,2,,"4/14 2+ chicks between 528 and 530" +2021,alley_north,528,whib,2021-04-14,,1,,"4/14 2+ chicks between 528 and 530" +2021,alley_north,528,whib,2021-04-20,,0,fledged,"4/14 2+ chicks between 528 and 530" +2021,alley_north,528,whib,2021-04-27,,,,"4/14 2+ chicks between 528 and 530" +2021,alley_north,530,whib,2021-03-09,,,,"4/14 2+ chicks between 528 and 530" +2021,alley_north,530,whib,2021-03-16,2,,,"4/14 2+ chicks between 528 and 530" +2021,alley_north,530,whib,2021-03-23,2,,,"4/14 2+ chicks between 528 and 530" +2021,alley_north,530,whib,2021-03-30,,2,,"4/14 2+ chicks between 528 and 530" +2021,alley_north,530,whib,2021-04-06,,2,,"4/14 2+ chicks between 528 and 530" +2021,alley_north,530,whib,2021-04-14,,1,,"4/14 2+ chicks between 528 and 530" +2021,alley_north,530,whib,2021-04-20,,0,fledged,"4/14 2+ chicks between 528 and 530" +2021,alley_north,530,whib,2021-04-27,,,,"4/14 2+ chicks between 528 and 530" +2021,alley_north,513,whib,2021-03-09,2,,, +2021,alley_north,513,whib,2021-03-16,2,,, +2021,alley_north,513,whib,2021-03-23,2,,, +2021,alley_north,513,whib,2021-03-30,,2,, +2021,alley_north,513,whib,2021-04-06,,2,, +2021,alley_north,513,whib,2021-04-14,,2,, +2021,alley_north,513,whib,2021-04-20,,0,fledged, +2021,alley_north,513,whib,2021-04-27,,,, +2021,alley_north,532,whib,2021-03-09,,,, +2021,alley_north,532,whib,2021-03-16,2,,, +2021,alley_north,532,whib,2021-03-23,2,,, +2021,alley_north,532,whib,2021-03-30,,2,, +2021,alley_north,532,whib,2021-04-06,,2,, +2021,alley_north,532,whib,2021-04-14,,2,, +2021,alley_north,532,whib,2021-04-20,,0,fledged, +2021,alley_north,532,whib,2021-04-27,,,, +2021,alley_north,472,whib,2021-03-09,2,,,"4/14 5 chicks between 472, 474, and 476" +2021,alley_north,472,whib,2021-03-16,2,,,"4/14 5 chicks between 472, 474, and 476" +2021,alley_north,472,whib,2021-03-23,2,,,"4/14 5 chicks between 472, 474, and 476" +2021,alley_north,472,whib,2021-03-30,,2,,"4/14 5 chicks between 472, 474, and 476" +2021,alley_north,472,whib,2021-04-06,,2,,"4/14 5 chicks between 472, 474, and 476" +2021,alley_north,472,whib,2021-04-14,,1,,"4/14 5 chicks between 472, 474, and 476" +2021,alley_north,472,whib,2021-04-20,,0,fledged,"4/14 5 chicks between 472, 474, and 476" +2021,alley_north,472,whib,2021-04-27,,,,"4/14 5 chicks between 472, 474, and 476" +2021,alley_north,474,whib,2021-03-09,3,,,"4/14 5 chicks between 472, 474, and 476" +2021,alley_north,474,whib,2021-03-16,2,,,"4/14 5 chicks between 472, 474, and 476" +2021,alley_north,474,whib,2021-03-23,2,,,"4/14 5 chicks between 472, 474, and 476" +2021,alley_north,474,whib,2021-03-30,,2,,"4/14 5 chicks between 472, 474, and 476" +2021,alley_north,474,whib,2021-04-06,,2,,"4/14 5 chicks between 472, 474, and 476" +2021,alley_north,474,whib,2021-04-14,,2,,"4/14 5 chicks between 472, 474, and 476" +2021,alley_north,474,whib,2021-04-20,,0,fledged,"4/14 5 chicks between 472, 474, and 476" +2021,alley_north,474,whib,2021-04-27,,,,"4/14 5 chicks between 472, 474, and 476" +2021,alley_north,476,whib,2021-03-09,2,,,"4/14 5 chicks between 472, 474, and 476" +2021,alley_north,476,whib,2021-03-16,3,,,"4/14 5 chicks between 472, 474, and 476" +2021,alley_north,476,whib,2021-03-23,3,,,"4/14 5 chicks between 472, 474, and 476" +2021,alley_north,476,whib,2021-03-30,1,2,,"4/14 5 chicks between 472, 474, and 476" +2021,alley_north,476,whib,2021-04-06,,2,,"4/14 5 chicks between 472, 474, and 476" +2021,alley_north,476,whib,2021-04-14,,2,,"4/14 5 chicks between 472, 474, and 476" +2021,alley_north,476,whib,2021-04-20,,0,fledged,"4/14 5 chicks between 472, 474, and 476" +2021,alley_north,476,whib,2021-04-27,,,,"4/14 5 chicks between 472, 474, and 476" +2021,alley_north,478,greg,2021-03-09,3,,,"4/20 mercury" +2021,alley_north,478,greg,2021-03-16,3,,,"4/20 mercury" +2021,alley_north,478,greg,2021-03-23,,2,,"4/20 mercury" +2021,alley_north,478,greg,2021-03-30,,2,,"4/20 mercury" +2021,alley_north,478,greg,2021-04-06,,2,,"4/20 mercury" +2021,alley_north,478,greg,2021-04-14,,2,,"4/20 mercury" +2021,alley_north,478,greg,2021-04-20,,2,,"4/20 mercury" +2021,alley_north,478,greg,2021-04-27,,,,"4/20 mercury" +2021,alley_north,399,whib,2021-03-09,2,,, +2021,alley_north,399,whib,2021-03-16,3,,, +2021,alley_north,399,whib,2021-03-23,3,,, +2021,alley_north,399,whib,2021-03-30,1,2,, +2021,alley_north,399,whib,2021-04-06,,2,, +2021,alley_north,399,whib,2021-04-14,,2,, +2021,alley_north,399,whib,2021-04-20,,0,fledged, +2021,alley_north,399,whib,2021-04-27,,,, +2021,alley_north,401,whib,2021-03-09,3,,, +2021,alley_north,401,whib,2021-03-16,2,,, +2021,alley_north,401,whib,2021-03-23,0,,empty, +2021,alley_north,401,whib,2021-03-30,,,, +2021,alley_north,401,whib,2021-04-06,,,, +2021,alley_north,401,whib,2021-04-14,,,, +2021,alley_north,401,whib,2021-04-20,,,, +2021,alley_north,401,whib,2021-04-27,,,, +2021,alley_north,403,greg,2021-03-09,4,,,"4/27 mercury" +2021,alley_north,403,greg,2021-03-16,4,,,"4/27 mercury" +2021,alley_north,403,greg,2021-03-23,4,,,"4/27 mercury" +2021,alley_north,403,greg,2021-03-30,1,3,,"4/27 mercury" +2021,alley_north,403,greg,2021-04-06,,3,,"4/27 mercury" +2021,alley_north,403,greg,2021-04-14,,3,,"4/27 mercury" +2021,alley_north,403,greg,2021-04-20,,2,,"4/27 mercury" +2021,alley_north,403,greg,2021-04-27,,1,,"4/27 mercury" +2021,alley_north,515,whib,2021-03-09,1,,,"3/30 collapsed" +2021,alley_north,515,whib,2021-03-16,1,,,"3/30 collapsed" +2021,alley_north,515,whib,2021-03-23,0,,empty,"3/30 collapsed" +2021,alley_north,515,whib,2021-03-30,,,,"3/30 collapsed" +2021,alley_north,515,whib,2021-04-06,,,,"3/30 collapsed" +2021,alley_north,515,whib,2021-04-14,,,,"3/30 collapsed" +2021,alley_north,515,whib,2021-04-20,,,,"3/30 collapsed" +2021,alley_north,515,whib,2021-04-27,,,,"3/30 collapsed" +2021,alley_north,517,whib,2021-03-09,1,,, +2021,alley_north,517,whib,2021-03-16,0,,empty, +2021,alley_north,517,whib,2021-03-23,,,, +2021,alley_north,517,whib,2021-03-30,,,, +2021,alley_north,517,whib,2021-04-06,,,, +2021,alley_north,517,whib,2021-04-14,,,, +2021,alley_north,517,whib,2021-04-20,,,, +2021,alley_north,517,whib,2021-04-27,,,, +2021,alley_north,519,whib,2021-03-09,2,,, +2021,alley_north,519,whib,2021-03-16,2,,, +2021,alley_north,519,whib,2021-03-23,2,,, +2021,alley_north,519,whib,2021-03-30,,2,, +2021,alley_north,519,whib,2021-04-06,,2,, +2021,alley_north,519,whib,2021-04-14,,2,, +2021,alley_north,519,whib,2021-04-20,,2,, +2021,alley_north,519,whib,2021-04-27,,0,fledged, +2021,alley_north,521,greg,2021-03-09,3,,, +2021,alley_north,521,greg,2021-03-16,3,,, +2021,alley_north,521,greg,2021-03-23,3,,, +2021,alley_north,521,greg,2021-03-30,2,1,pipping, +2021,alley_north,521,greg,2021-04-06,,1,, +2021,alley_north,521,greg,2021-04-14,,2,, +2021,alley_north,521,greg,2021-04-20,,2,, +2021,alley_north,521,greg,2021-04-27,,2,, +2021,alley_north,523,greg,2021-03-09,1,,,"3/16 eggshell in nest" +2021,alley_north,523,greg,2021-03-16,0,,empty,"3/16 eggshell in nest" +2021,alley_north,523,greg,2021-03-23,,,,"3/16 eggshell in nest" +2021,alley_north,523,greg,2021-03-30,,,,"3/16 eggshell in nest" +2021,alley_north,523,greg,2021-04-06,,,,"3/16 eggshell in nest" +2021,alley_north,523,greg,2021-04-14,,,,"3/16 eggshell in nest" +2021,alley_north,523,greg,2021-04-20,,,,"3/16 eggshell in nest" +2021,alley_north,523,greg,2021-04-27,,,,"3/16 eggshell in nest" +2021,alley_north,557,whib,2021-03-09,,,, +2021,alley_north,557,whib,2021-03-16,2,,, +2021,alley_north,557,whib,2021-03-23,2,,, +2021,alley_north,557,whib,2021-03-30,,2,wet_chick, +2021,alley_north,557,whib,2021-04-06,,2,, +2021,alley_north,557,whib,2021-04-14,,2,, +2021,alley_north,557,whib,2021-04-20,,2,fledged, +2021,alley_north,557,whib,2021-04-27,,,, +2021,alley_north,559,whib,2021-03-09,,,, +2021,alley_north,559,whib,2021-03-16,2,,, +2021,alley_north,559,whib,2021-03-23,2,,, +2021,alley_north,559,whib,2021-03-30,1,1,pipping, +2021,alley_north,559,whib,2021-04-06,,2,, +2021,alley_north,559,whib,2021-04-14,,2,, +2021,alley_north,559,whib,2021-04-20,,2,fledged, +2021,alley_north,559,whib,2021-04-27,,,, +2021,alley_north,405,greg,2021-03-09,2,,, +2021,alley_north,405,greg,2021-03-16,0,,empty, +2021,alley_north,405,greg,2021-03-23,,,, +2021,alley_north,405,greg,2021-03-30,,,, +2021,alley_north,405,greg,2021-04-06,,,, +2021,alley_north,405,greg,2021-04-14,,,, +2021,alley_north,405,greg,2021-04-20,,,, +2021,alley_north,405,greg,2021-04-27,,,, +2021,alley_north,407,whib,2021-03-09,2,,, +2021,alley_north,407,whib,2021-03-16,0,,empty, +2021,alley_north,407,whib,2021-03-23,,,, +2021,alley_north,407,whib,2021-03-30,,,, +2021,alley_north,407,whib,2021-04-06,,,, +2021,alley_north,407,whib,2021-04-14,,,, +2021,alley_north,407,whib,2021-04-20,,,, +2021,alley_north,407,whib,2021-04-27,,,, +2021,alley_north,409,whib,2021-03-09,2,,, +2021,alley_north,409,whib,2021-03-16,2,,, +2021,alley_north,409,whib,2021-03-23,0,,empty, +2021,alley_north,409,whib,2021-03-30,,,, +2021,alley_north,409,whib,2021-04-06,,,, +2021,alley_north,409,whib,2021-04-14,,,, +2021,alley_north,409,whib,2021-04-20,,,, +2021,alley_north,409,whib,2021-04-27,,,, +2021,alley_north,411,greg,2021-03-09,2,,, +2021,alley_north,411,greg,2021-03-16,2,,, +2021,alley_north,411,greg,2021-03-23,0,,empty, +2021,alley_north,411,greg,2021-03-30,,,, +2021,alley_north,411,greg,2021-04-06,,,, +2021,alley_north,411,greg,2021-04-14,,,, +2021,alley_north,411,greg,2021-04-20,,,, +2021,alley_north,411,greg,2021-04-27,,,, +2021,alley_north,480,whib,2021-03-09,1,,, +2021,alley_north,480,whib,2021-03-16,1,,, +2021,alley_north,480,whib,2021-03-23,0,,empty, +2021,alley_north,480,whib,2021-03-30,,,, +2021,alley_north,480,whib,2021-04-06,,,, +2021,alley_north,480,whib,2021-04-14,,,, +2021,alley_north,480,whib,2021-04-20,,,, +2021,alley_north,480,whib,2021-04-27,,,, +2021,alley_north,482,whib,2021-03-09,1,,, +2021,alley_north,482,whib,2021-03-16,2,,, +2021,alley_north,482,whib,2021-03-23,2,,, +2021,alley_north,482,whib,2021-03-30,,2,wet_chick, +2021,alley_north,482,whib,2021-04-06,,2,, +2021,alley_north,482,whib,2021-04-14,,0,empty, +2021,alley_north,482,whib,2021-04-20,,,, +2021,alley_north,482,whib,2021-04-27,,,, +2021,alley_north,484,whib,2021-03-09,1,,, +2021,alley_north,484,whib,2021-03-16,2,,, +2021,alley_north,484,whib,2021-03-23,0,,empty, +2021,alley_north,484,whib,2021-03-30,,,, +2021,alley_north,484,whib,2021-04-06,,,, +2021,alley_north,484,whib,2021-04-14,,,, +2021,alley_north,484,whib,2021-04-20,,,, +2021,alley_north,484,whib,2021-04-27,,,, +2021,alley_north,525,whib,2021-03-09,2,,,"3/16 appeared to be collapsing" +2021,alley_north,525,whib,2021-03-16,0,,empty,"3/16 appeared to be collapsing" +2021,alley_north,525,whib,2021-03-23,,,,"3/16 appeared to be collapsing" +2021,alley_north,525,whib,2021-03-30,,,,"3/16 appeared to be collapsing" +2021,alley_north,525,whib,2021-04-06,,,,"3/16 appeared to be collapsing" +2021,alley_north,525,whib,2021-04-14,,,,"3/16 appeared to be collapsing" +2021,alley_north,525,whib,2021-04-20,,,,"3/16 appeared to be collapsing" +2021,alley_north,525,whib,2021-04-27,,,,"3/16 appeared to be collapsing" +2021,alley_north,527,whib,2021-03-09,2,,, +2021,alley_north,527,whib,2021-03-16,2,,, +2021,alley_north,527,whib,2021-03-23,0,,empty, +2021,alley_north,527,whib,2021-03-30,,,, +2021,alley_north,527,whib,2021-04-06,,,, +2021,alley_north,527,whib,2021-04-14,,,, +2021,alley_north,527,whib,2021-04-20,,,, +2021,alley_north,527,whib,2021-04-27,,,, +2021,alley_north,529,whib,2021-03-09,1,,, +2021,alley_north,529,whib,2021-03-16,1,,, +2021,alley_north,529,whib,2021-03-23,0,,empty, +2021,alley_north,529,whib,2021-03-30,,,, +2021,alley_north,529,whib,2021-04-06,,,, +2021,alley_north,529,whib,2021-04-14,,,, +2021,alley_north,529,whib,2021-04-20,,,, +2021,alley_north,529,whib,2021-04-27,,,, +2021,alley_north,413,whib,2021-03-09,1,,, +2021,alley_north,413,whib,2021-03-16,2,,, +2021,alley_north,413,whib,2021-03-23,0,,empty, +2021,alley_north,413,whib,2021-03-30,,,, +2021,alley_north,413,whib,2021-04-06,,,, +2021,alley_north,413,whib,2021-04-14,,,, +2021,alley_north,413,whib,2021-04-20,,,, +2021,alley_north,413,whib,2021-04-27,,,, +2021,alley_north,415,whib,2021-03-09,2,,,"4/14 nest collapsed" +2021,alley_north,415,whib,2021-03-16,0,,empty,"4/14 nest collapsed" +2021,alley_north,415,whib,2021-03-23,,,,"4/14 nest collapsed" +2021,alley_north,415,whib,2021-03-30,,,,"4/14 nest collapsed" +2021,alley_north,415,whib,2021-04-06,,,,"4/14 nest collapsed" +2021,alley_north,415,whib,2021-04-14,,,,"4/14 nest collapsed" +2021,alley_north,415,whib,2021-04-20,,,,"4/14 nest collapsed" +2021,alley_north,415,whib,2021-04-27,,,,"4/14 nest collapsed" +2021,alley_north,571,whib,2021-03-09,,,, +2021,alley_north,571,whib,2021-03-16,,,, +2021,alley_north,571,whib,2021-03-23,3,,, +2021,alley_north,571,whib,2021-03-30,1,2,, +2021,alley_north,571,whib,2021-04-06,,2,, +2021,alley_north,571,whib,2021-04-14,,2,, +2021,alley_north,571,whib,2021-04-20,,0,fledged, +2021,alley_north,571,whib,2021-04-27,,,, +2021,alley_north,573,whib,2021-03-09,,,,"3/23 new" +2021,alley_north,573,whib,2021-03-16,,,,"3/23 new" +2021,alley_north,573,whib,2021-03-23,1,,,"3/23 new" +2021,alley_north,573,whib,2021-03-30,,1,,"3/23 new" +2021,alley_north,573,whib,2021-04-06,,1,,"3/23 new" +2021,alley_north,573,whib,2021-04-14,,1,,"3/23 new" +2021,alley_north,573,whib,2021-04-20,,0,fledged,"3/23 new" +2021,alley_north,573,whib,2021-04-27,,,,"3/23 new" +2021,alley_north,575,whib,2021-03-09,,,,"3/23 new" +2021,alley_north,575,whib,2021-03-16,,,,"3/23 new" +2021,alley_north,575,whib,2021-03-23,1,,,"3/23 new" +2021,alley_north,575,whib,2021-03-30,1,,,"3/23 new" +2021,alley_north,575,whib,2021-04-06,0,,empty,"3/23 new" +2021,alley_north,575,whib,2021-04-14,,,,"3/23 new" +2021,alley_north,575,whib,2021-04-20,,0,fledged,"3/23 new" +2021,alley_north,575,whib,2021-04-27,,,,"3/23 new" +2021,alley_north,577,whib,2021-03-09,,,,"3/23 new" +2021,alley_north,577,whib,2021-03-16,,,,"3/23 new" +2021,alley_north,577,whib,2021-03-23,2,,,"3/23 new" +2021,alley_north,577,whib,2021-03-30,,2,,"3/23 new" +2021,alley_north,577,whib,2021-04-06,,0,empty,"3/23 new" +2021,alley_north,577,whib,2021-04-14,,,,"3/23 new" +2021,alley_north,577,whib,2021-04-20,,0,fledged,"3/23 new" +2021,alley_north,577,whib,2021-04-27,,,,"3/23 new" +2021,alley_north,531,whib,2021-03-09,2,,, +2021,alley_north,531,whib,2021-03-16,0,,empty, +2021,alley_north,531,whib,2021-03-23,,,, +2021,alley_north,531,whib,2021-03-30,,,, +2021,alley_north,531,whib,2021-04-06,,,, +2021,alley_north,531,whib,2021-04-14,,,, +2021,alley_north,531,whib,2021-04-20,,0,fledged, +2021,alley_north,531,whib,2021-04-27,,,, +2021,alley_north,533,whib,2021-03-09,2,,, +2021,alley_north,533,whib,2021-03-16,2,,, +2021,alley_north,533,whib,2021-03-23,2,,, +2021,alley_north,533,whib,2021-03-30,1,1,, +2021,alley_north,533,whib,2021-04-06,1,1,, +2021,alley_north,533,whib,2021-04-14,1,,, +2021,alley_north,533,whib,2021-04-20,,0,fledged, +2021,alley_north,533,whib,2021-04-27,,,, +2021,alley_north,535,whib,2021-03-09,1,,,"3/16 collapsed" +2021,alley_north,535,whib,2021-03-16,0,,empty,"3/16 collapsed" +2021,alley_north,535,whib,2021-03-23,,,,"3/16 collapsed" +2021,alley_north,535,whib,2021-03-30,,,,"3/16 collapsed" +2021,alley_north,535,whib,2021-04-06,,,,"3/16 collapsed" +2021,alley_north,535,whib,2021-04-14,,,,"3/16 collapsed" +2021,alley_north,535,whib,2021-04-20,,,,"3/16 collapsed" +2021,alley_north,535,whib,2021-04-27,,,,"3/16 collapsed" +2021,alley_north,537,whib,2021-03-09,2,,, +2021,alley_north,537,whib,2021-03-16,0,,empty, +2021,alley_north,537,whib,2021-03-23,,,, +2021,alley_north,537,whib,2021-03-30,,,, +2021,alley_north,537,whib,2021-04-06,,,, +2021,alley_north,537,whib,2021-04-14,,,, +2021,alley_north,537,whib,2021-04-20,,,, +2021,alley_north,537,whib,2021-04-27,,,, +2021,alley_north,539,whib,2021-03-09,1,,, +2021,alley_north,539,whib,2021-03-16,2,,, +2021,alley_north,539,whib,2021-03-23,2,,, +2021,alley_north,539,whib,2021-03-30,1,1,, +2021,alley_north,539,whib,2021-04-06,,2,, +2021,alley_north,539,whib,2021-04-14,,2,, +2021,alley_north,539,whib,2021-04-20,,0,fledged, +2021,alley_north,539,whib,2021-04-27,,,, +2021,alley_north,541,whib,2021-03-09,2,,, +2021,alley_north,541,whib,2021-03-16,2,,, +2021,alley_north,541,whib,2021-03-23,2,,, +2021,alley_north,541,whib,2021-03-30,,2,, +2021,alley_north,541,whib,2021-04-06,,2,, +2021,alley_north,541,whib,2021-04-14,,2,, +2021,alley_north,541,whib,2021-04-20,,0,fledged, +2021,alley_north,541,whib,2021-04-27,,,, +2021,alley_north,543,whib,2021-03-09,2,,, +2021,alley_north,543,whib,2021-03-16,2,,, +2021,alley_north,543,whib,2021-03-23,2,,, +2021,alley_north,543,whib,2021-03-30,2,,, +2021,alley_north,543,whib,2021-04-06,2,,, +2021,alley_north,543,whib,2021-04-14,,0,empty, +2021,alley_north,543,whib,2021-04-20,1,,, +2021,alley_north,543,whib,2021-04-27,,0,fledged, +2021,alley_north,565,whib,2021-03-09,,,, +2021,alley_north,565,whib,2021-03-16,3,,, +2021,alley_north,565,whib,2021-03-23,0,,empty, +2021,alley_north,565,whib,2021-03-30,,,, +2021,alley_north,565,whib,2021-04-06,,,, +2021,alley_north,565,whib,2021-04-14,,,, +2021,alley_north,565,whib,2021-04-20,,,, +2021,alley_north,565,whib,2021-04-27,,,, +2021,alley_north,486,whib,2021-03-09,2,,, +2021,alley_north,486,whib,2021-03-16,1,,, +2021,alley_north,486,whib,2021-03-23,1,,, +2021,alley_north,486,whib,2021-03-30,1,,, +2021,alley_north,486,whib,2021-04-06,0,,empty, +2021,alley_north,486,whib,2021-04-14,,,, +2021,alley_north,486,whib,2021-04-20,,,, +2021,alley_north,486,whib,2021-04-27,,,, +2021,alley_north,561,whib,2021-03-09,,,, +2021,alley_north,561,whib,2021-03-16,2,,, +2021,alley_north,561,whib,2021-03-23,0,,empty, +2021,alley_north,561,whib,2021-03-30,,,, +2021,alley_north,561,whib,2021-04-06,,,, +2021,alley_north,561,whib,2021-04-14,,,, +2021,alley_north,561,whib,2021-04-20,,,, +2021,alley_north,561,whib,2021-04-27,,,, +2021,alley_north,563,whib,2021-03-09,,,,"4/14 2 chicks between 563 and 567" +2021,alley_north,563,whib,2021-03-16,2,,,"4/14 2 chicks between 563 and 567" +2021,alley_north,563,whib,2021-03-23,2,,,"4/14 2 chicks between 563 and 567" +2021,alley_north,563,whib,2021-03-30,,2,,"4/14 2 chicks between 563 and 567" +2021,alley_north,563,whib,2021-04-06,,2,,"4/14 2 chicks between 563 and 567" +2021,alley_north,563,whib,2021-04-14,,1,,"4/14 2 chicks between 563 and 567" +2021,alley_north,563,whib,2021-04-20,,0,fledged,"4/14 2 chicks between 563 and 567" +2021,alley_north,563,whib,2021-04-27,,,,"4/14 2 chicks between 563 and 567" +2021,alley_north,488,whib,2021-03-09,2,,, +2021,alley_north,488,whib,2021-03-16,0,,empty, +2021,alley_north,488,whib,2021-03-23,,,, +2021,alley_north,488,whib,2021-03-30,,,, +2021,alley_north,488,whib,2021-04-06,,,, +2021,alley_north,488,whib,2021-04-14,,,, +2021,alley_north,488,whib,2021-04-20,,,, +2021,alley_north,488,whib,2021-04-27,,,, +2021,alley_north,490,whib,2021-03-09,2,,, +2021,alley_north,490,whib,2021-03-16,2,,, +2021,alley_north,490,whib,2021-03-23,0,,empty, +2021,alley_north,490,whib,2021-03-30,,,, +2021,alley_north,490,whib,2021-04-06,,,, +2021,alley_north,490,whib,2021-04-14,,,, +2021,alley_north,490,whib,2021-04-20,,,, +2021,alley_north,490,whib,2021-04-27,,,, +2021,alley_north,492,whib,2021-03-09,2,,, +2021,alley_north,492,whib,2021-03-16,2,,, +2021,alley_north,492,whib,2021-03-23,2,,, +2021,alley_north,492,whib,2021-03-30,,2,, +2021,alley_north,492,whib,2021-04-06,,2,, +2021,alley_north,492,whib,2021-04-14,,0,empty, +2021,alley_north,492,whib,2021-04-20,,,, +2021,alley_north,492,whib,2021-04-27,,,, +2021,alley_north,494,whib,2021-03-09,1,,,"3/16 eggshell in nest" +2021,alley_north,494,whib,2021-03-16,0,,empty,"3/16 eggshell in nest" +2021,alley_north,494,whib,2021-03-23,,,,"3/16 eggshell in nest" +2021,alley_north,494,whib,2021-03-30,,,,"3/16 eggshell in nest" +2021,alley_north,494,whib,2021-04-06,,,,"3/16 eggshell in nest" +2021,alley_north,494,whib,2021-04-14,,,,"3/16 eggshell in nest" +2021,alley_north,494,whib,2021-04-20,,,,"3/16 eggshell in nest" +2021,alley_north,494,whib,2021-04-27,,,,"3/16 eggshell in nest" +2021,alley_north,417,whib,2021-03-09,2,,, +2021,alley_north,417,whib,2021-03-16,2,,, +2021,alley_north,417,whib,2021-03-23,2,,, +2021,alley_north,417,whib,2021-03-30,0,,empty, +2021,alley_north,417,whib,2021-04-06,,,, +2021,alley_north,417,whib,2021-04-14,,,, +2021,alley_north,417,whib,2021-04-20,,,, +2021,alley_north,417,whib,2021-04-27,,,, +2021,alley_north,419,whib,2021-03-09,2,,,"3/16 collapsed" +2021,alley_north,419,whib,2021-03-16,0,,empty,"3/16 collapsed" +2021,alley_north,419,whib,2021-03-23,,,,"3/16 collapsed" +2021,alley_north,419,whib,2021-03-30,,,,"3/16 collapsed" +2021,alley_north,419,whib,2021-04-06,,,,"3/16 collapsed" +2021,alley_north,419,whib,2021-04-14,,,,"3/16 collapsed" +2021,alley_north,419,whib,2021-04-20,,,,"3/16 collapsed" +2021,alley_north,419,whib,2021-04-27,,,,"3/16 collapsed" +2021,alley_north,421,whib,2021-03-09,2,,, +2021,alley_north,421,whib,2021-03-16,1,,, +2021,alley_north,421,whib,2021-03-23,0,,empty, +2021,alley_north,421,whib,2021-03-30,,,, +2021,alley_north,421,whib,2021-04-06,,,, +2021,alley_north,421,whib,2021-04-14,,,, +2021,alley_north,421,whib,2021-04-20,,,, +2021,alley_north,421,whib,2021-04-27,,,, +2021,alley_north,423,whib,2021-03-09,2,,, +2021,alley_north,423,whib,2021-03-16,1,,, +2021,alley_north,423,whib,2021-03-23,0,,empty, +2021,alley_north,423,whib,2021-03-30,,,, +2021,alley_north,423,whib,2021-04-06,,,, +2021,alley_north,423,whib,2021-04-14,,,, +2021,alley_north,423,whib,2021-04-20,,,, +2021,alley_north,423,whib,2021-04-27,,,, +2021,alley_north,425,whib,2021-03-09,1,,, +2021,alley_north,425,whib,2021-03-16,2,,, +2021,alley_north,425,whib,2021-03-23,2,,, +2021,alley_north,425,whib,2021-03-30,1,1,, +2021,alley_north,425,whib,2021-04-06,,1,, +2021,alley_north,425,whib,2021-04-14,,2,, +2021,alley_north,425,whib,2021-04-20,,0,fledged, +2021,alley_north,425,whib,2021-04-27,,,, +2021,alley_north,567,whib,2021-03-09,,,,"4/14 2 chicks between 563 and 567" +2021,alley_north,567,whib,2021-03-16,3,,,"4/14 2 chicks between 563 and 567" +2021,alley_north,567,whib,2021-03-23,3,,,"4/14 2 chicks between 563 and 567" +2021,alley_north,567,whib,2021-03-30,,2,,"4/14 2 chicks between 563 and 567" +2021,alley_north,567,whib,2021-04-06,,2,,"4/14 2 chicks between 563 and 567" +2021,alley_north,567,whib,2021-04-14,,1,,"4/14 2 chicks between 563 and 567" +2021,alley_north,567,whib,2021-04-20,,0,fledged,"4/14 2 chicks between 563 and 567" +2021,alley_north,567,whib,2021-04-27,,,,"4/14 2 chicks between 563 and 567" +2021,alley_north,545,whib,2021-03-09,2,,, +2021,alley_north,545,whib,2021-03-16,2,,, +2021,alley_north,545,whib,2021-03-23,2,,, +2021,alley_north,545,whib,2021-03-30,0,,empty, +2021,alley_north,545,whib,2021-04-06,,,, +2021,alley_north,545,whib,2021-04-14,,,, +2021,alley_north,545,whib,2021-04-20,,,, +2021,alley_north,545,whib,2021-04-27,,,, +2021,alley_north,547,whib,2021-03-09,3,,,"4/14 4 chicks between 547 and 549" +2021,alley_north,547,whib,2021-03-16,3,,,"4/14 4 chicks between 547 and 549" +2021,alley_north,547,whib,2021-03-23,3,,,"4/14 4 chicks between 547 and 549" +2021,alley_north,547,whib,2021-03-30,,2,,"4/14 4 chicks between 547 and 549" +2021,alley_north,547,whib,2021-04-06,,1,,"4/14 4 chicks between 547 and 549" +2021,alley_north,547,whib,2021-04-14,,2,,"4/14 4 chicks between 547 and 549" +2021,alley_north,547,whib,2021-04-20,,0,,"4/14 4 chicks between 547 and 549" +2021,alley_north,547,whib,2021-04-27,,,,"4/14 4 chicks between 547 and 549" +2021,alley_north,549,whib,2021-03-09,2,,,"4/14 4 chicks between 547 and 549" +2021,alley_north,549,whib,2021-03-16,2,,,"4/14 4 chicks between 547 and 549" +2021,alley_north,549,whib,2021-03-23,2,,,"4/14 4 chicks between 547 and 549" +2021,alley_north,549,whib,2021-03-30,,2,,"4/14 4 chicks between 547 and 549" +2021,alley_north,549,whib,2021-04-06,,2,,"4/14 4 chicks between 547 and 549" +2021,alley_north,549,whib,2021-04-14,,2,,"4/14 4 chicks between 547 and 549" +2021,alley_north,549,whib,2021-04-20,,0,fledged,"4/14 4 chicks between 547 and 549" +2021,alley_north,549,whib,2021-04-27,,,,"4/14 4 chicks between 547 and 549" +2021,alley_north,551,whib,2021-03-09,2,,, +2021,alley_north,551,whib,2021-03-16,0,,empty, +2021,alley_north,551,whib,2021-03-23,,,, +2021,alley_north,551,whib,2021-03-30,,,, +2021,alley_north,551,whib,2021-04-06,,,, +2021,alley_north,551,whib,2021-04-14,,,, +2021,alley_north,551,whib,2021-04-20,,,, +2021,alley_north,551,whib,2021-04-27,,,, +2021,alley_north,496,whib,2021-03-09,2,,, +2021,alley_north,496,whib,2021-03-16,0,,empty, +2021,alley_north,496,whib,2021-03-23,,,, +2021,alley_north,496,whib,2021-03-30,,,, +2021,alley_north,496,whib,2021-04-06,,,, +2021,alley_north,496,whib,2021-04-14,,,, +2021,alley_north,496,whib,2021-04-20,,,, +2021,alley_north,496,whib,2021-04-27,,,, +2021,alley_north,427,whib,2021-03-09,1,,, +2021,alley_north,427,whib,2021-03-16,2,,, +2021,alley_north,427,whib,2021-03-23,2,,, +2021,alley_north,427,whib,2021-03-30,1,1,pipping, +2021,alley_north,427,whib,2021-04-06,,2,, +2021,alley_north,427,whib,2021-04-14,,2,, +2021,alley_north,427,whib,2021-04-20,,0,fledged, +2021,alley_north,427,whib,2021-04-27,,,, +2021,alley_north,498,whib,2021-03-09,2,,,"4/6 collapsed" +2021,alley_north,498,whib,2021-03-16,0,,empty,"4/6 collapsed" +2021,alley_north,498,whib,2021-03-23,,,,"4/6 collapsed" +2021,alley_north,498,whib,2021-03-30,,,,"4/6 collapsed" +2021,alley_north,498,whib,2021-04-06,,,,"4/6 collapsed" +2021,alley_north,498,whib,2021-04-14,,,,"4/6 collapsed" +2021,alley_north,498,whib,2021-04-20,,,,"4/6 collapsed" +2021,alley_north,498,whib,2021-04-27,,,,"4/6 collapsed" +2021,alley_north,512,whib,2021-03-09,,,, +2021,alley_north,512,whib,2021-03-16,2,,, +2021,alley_north,512,whib,2021-03-23,2,,, +2021,alley_north,512,whib,2021-03-30,2,,, +2021,alley_north,512,whib,2021-04-06,2,,, +2021,alley_north,512,whib,2021-04-14,2,,, +2021,alley_north,512,whib,2021-04-20,2,,, +2021,alley_north,512,whib,2021-04-27,,0,fledged, +2021,alley_north,514,whib,2021-03-09,,,, +2021,alley_north,514,whib,2021-03-16,2,,, +2021,alley_north,514,whib,2021-03-23,2,,, +2021,alley_north,514,whib,2021-03-30,2,,, +2021,alley_north,514,whib,2021-04-06,1,1,, +2021,alley_north,514,whib,2021-04-14,,1,, +2021,alley_north,514,whib,2021-04-20,,0,fledged, +2021,alley_north,514,whib,2021-04-27,,,, +2021,alley_north,516,whib,2021-03-09,,,, +2021,alley_north,516,whib,2021-03-16,3,,, +2021,alley_north,516,whib,2021-03-23,1,,, +2021,alley_north,516,whib,2021-03-30,2,,, +2021,alley_north,516,whib,2021-04-06,2,,, +2021,alley_north,516,whib,2021-04-14,0,,empty, +2021,alley_north,516,whib,2021-04-20,,,, +2021,alley_north,516,whib,2021-04-27,,,, +2021,alley_north,518,whib,2021-03-09,,,,"4/14 3 chicks between 518 and 520" +2021,alley_north,518,whib,2021-03-16,2,,,"4/14 3 chicks between 518 and 520" +2021,alley_north,518,whib,2021-03-23,2,,,"4/14 3 chicks between 518 and 520" +2021,alley_north,518,whib,2021-03-30,,2,,"4/14 3 chicks between 518 and 520" +2021,alley_north,518,whib,2021-04-06,,2,,"4/14 3 chicks between 518 and 520" +2021,alley_north,518,whib,2021-04-14,,1,,"4/14 3 chicks between 518 and 520" +2021,alley_north,518,whib,2021-04-20,,0,fledged,"4/14 3 chicks between 518 and 520" +2021,alley_north,518,whib,2021-04-27,,,,"4/14 3 chicks between 518 and 520" +2021,alley_north,520,whib,2021-03-09,,,, +2021,alley_north,520,whib,2021-03-16,2,,, +2021,alley_north,520,whib,2021-03-23,2,,, +2021,alley_north,520,whib,2021-03-30,,2,, +2021,alley_north,520,whib,2021-04-06,,2,, +2021,alley_north,520,whib,2021-04-14,,2,, +2021,alley_north,520,whib,2021-04-20,,0,fledged, +2021,alley_north,520,whib,2021-04-27,,,, +2021,alley_north,522,whib,2021-03-09,,,, +2021,alley_north,522,whib,2021-03-16,2,,, +2021,alley_north,522,whib,2021-03-23,2,,, +2021,alley_north,522,whib,2021-03-30,,2,, +2021,alley_north,522,whib,2021-04-06,,2,, +2021,alley_north,522,whib,2021-04-14,,1,, +2021,alley_north,522,whib,2021-04-20,,0,fledged, +2021,alley_north,522,whib,2021-04-27,,,, +2021,alley_north,558,whib,2021-03-09,,,,"4/14 3 chicks between 558 and 560, fate of egg unknown" +2021,alley_north,558,whib,2021-03-16,,,,"4/14 3 chicks between 558 and 560, fate of egg unknown" +2021,alley_north,558,whib,2021-03-23,2,,,"4/14 3 chicks between 558 and 560, fate of egg unknown" +2021,alley_north,558,whib,2021-03-30,,,missed,"4/14 3 chicks between 558 and 560, fate of egg unknown" +2021,alley_north,558,whib,2021-04-06,1,1,,"4/14 3 chicks between 558 and 560, fate of egg unknown" +2021,alley_north,558,whib,2021-04-14,,1,,"4/14 3 chicks between 558 and 560, fate of egg unknown" +2021,alley_north,558,whib,2021-04-20,,0,fledged,"4/14 3 chicks between 558 and 560, fate of egg unknown" +2021,alley_north,558,whib,2021-04-27,,,,"4/14 3 chicks between 558 and 560, fate of egg unknown" +2021,alley_north,560,whib,2021-03-09,,,,"4/14 3 chicks between 558 and 560" +2021,alley_north,560,whib,2021-03-16,,,,"4/14 3 chicks between 558 and 560" +2021,alley_north,560,whib,2021-03-23,3,,,"4/14 3 chicks between 558 and 560" +2021,alley_north,560,whib,2021-03-30,,,missed,"4/14 3 chicks between 558 and 560" +2021,alley_north,560,whib,2021-04-06,,3,,"4/14 3 chicks between 558 and 560" +2021,alley_north,560,whib,2021-04-14,,2,,"4/14 3 chicks between 558 and 560" +2021,alley_north,560,whib,2021-04-20,,0,fledged,"4/14 3 chicks between 558 and 560" +2021,alley_north,560,whib,2021-04-27,,,,"4/14 3 chicks between 558 and 560" +2022,hidden,87,greg,2022-02-23,2,,incubating,"3/8: pulled, gone" +2022,hidden,87,greg,2022-03-01,,,empty,"3/8: pulled, gone" +2022,hidden,87,greg,2022-03-08,,,pulled,"3/8: pulled, gone" +2022,hidden,87,greg,2022-03-15,,,,"3/8: pulled, gone" +2022,hidden,87,greg,2022-03-16,,,,"3/8: pulled, gone" +2022,hidden,87,greg,2022-03-22,,,,"3/8: pulled, gone" +2022,hidden,87,greg,2022-03-29,,,,"3/8: pulled, gone" +2022,hidden,87,greg,2022-04-04,,,,"3/8: pulled, gone" +2022,hidden,87,greg,2022-04-12,,,,"3/8: pulled, gone" +2022,hidden,87,greg,2022-04-19,,,,"3/8: pulled, gone" +2022,hidden,87,greg,2022-05-03,,,,"3/8: pulled, gone" +2022,hidden,89,rosp,2022-02-23,3,,incubating,"3/1: wet chick, 3/15: dead vulture and sick vulture near 91, chicks dead (3/15), 3/29: carcass in nest, 4/19: pulled" +2022,hidden,89,rosp,2022-03-01,1,2,wet_chick,"3/1: wet chick, 3/15: dead vulture and sick vulture near 91, chicks dead (3/15), 3/29: carcass in nest, 4/19: pulled" +2022,hidden,89,rosp,2022-03-08,,3,nestling,"3/1: wet chick, 3/15: dead vulture and sick vulture near 91, chicks dead (3/15), 3/29: carcass in nest, 4/19: pulled" +2022,hidden,89,rosp,2022-03-15,,,empty,"3/1: wet chick, 3/15: dead vulture and sick vulture near 91, chicks dead (3/15), 3/29: carcass in nest, 4/19: pulled" +2022,hidden,89,rosp,2022-03-16,,,,"3/1: wet chick, 3/15: dead vulture and sick vulture near 91, chicks dead (3/15), 3/29: carcass in nest, 4/19: pulled" +2022,hidden,89,rosp,2022-03-22,,,empty,"3/1: wet chick, 3/15: dead vulture and sick vulture near 91, chicks dead (3/15), 3/29: carcass in nest, 4/19: pulled" +2022,hidden,89,rosp,2022-03-29,,,empty,"3/1: wet chick, 3/15: dead vulture and sick vulture near 91, chicks dead (3/15), 3/29: carcass in nest, 4/19: pulled" +2022,hidden,89,rosp,2022-04-04,,,empty,"3/1: wet chick, 3/15: dead vulture and sick vulture near 91, chicks dead (3/15), 3/29: carcass in nest, 4/19: pulled" +2022,hidden,89,rosp,2022-04-12,,,empty,"3/1: wet chick, 3/15: dead vulture and sick vulture near 91, chicks dead (3/15), 3/29: carcass in nest, 4/19: pulled" +2022,hidden,89,rosp,2022-04-19,,,,"3/1: wet chick, 3/15: dead vulture and sick vulture near 91, chicks dead (3/15), 3/29: carcass in nest, 4/19: pulled" +2022,hidden,89,rosp,2022-05-03,,,,"3/1: wet chick, 3/15: dead vulture and sick vulture near 91, chicks dead (3/15), 3/29: carcass in nest, 4/19: pulled" +2022,hidden,91,greg,2022-02-23,,2,nestling,"2/23: chick 2 days old, 3/22: pulled" +2022,hidden,91,greg,2022-03-01,,2,nestling,"2/23: chick 2 days old, 3/22: pulled" +2022,hidden,91,greg,2022-03-08,,2,nestling,"2/23: chick 2 days old, 3/22: pulled" +2022,hidden,91,greg,2022-03-15,,,empty,"2/23: chick 2 days old, 3/22: pulled" +2022,hidden,91,greg,2022-03-16,,,,"2/23: chick 2 days old, 3/22: pulled" +2022,hidden,91,greg,2022-03-22,,,empty,"2/23: chick 2 days old, 3/22: pulled" +2022,hidden,91,greg,2022-03-29,,,pulled,"2/23: chick 2 days old, 3/22: pulled" +2022,hidden,91,greg,2022-04-04,,,,"2/23: chick 2 days old, 3/22: pulled" +2022,hidden,91,greg,2022-04-12,,,,"2/23: chick 2 days old, 3/22: pulled" +2022,hidden,91,greg,2022-04-19,,,,"2/23: chick 2 days old, 3/22: pulled" +2022,hidden,91,greg,2022-05-03,,,,"2/23: chick 2 days old, 3/22: pulled" +2022,hidden,108,greg,2022-02-23,3,,incubating,"3/8: chick dry, 3/29: chick big" +2022,hidden,108,greg,2022-03-01,3,,incubating,"3/8: chick dry, 3/29: chick big" +2022,hidden,108,greg,2022-03-08,2,1,hatching,"3/8: chick dry, 3/29: chick big" +2022,hidden,108,greg,2022-03-15,,3,nestling,"3/8: chick dry, 3/29: chick big" +2022,hidden,108,greg,2022-03-16,,,,"3/8: chick dry, 3/29: chick big" +2022,hidden,108,greg,2022-03-22,,2,nestling,"3/8: chick dry, 3/29: chick big" +2022,hidden,108,greg,2022-03-29,,1,nestling,"3/8: chick dry, 3/29: chick big" +2022,hidden,108,greg,2022-04-04,,1,nestling,"3/8: chick dry, 3/29: chick big" +2022,hidden,108,greg,2022-04-12,,1,nestling,"3/8: chick dry, 3/29: chick big" +2022,hidden,108,greg,2022-04-19,,1,nestling,"3/8: chick dry, 3/29: chick big" +2022,hidden,108,greg,2022-05-03,,,empty,"3/8: chick dry, 3/29: chick big" +2022,hidden,110,rosp,2022-02-23,1,3,hatching,"3/22: probably fledged" +2022,hidden,110,rosp,2022-03-01,,2,nestling,"3/22: probably fledged" +2022,hidden,110,rosp,2022-03-08,,2,nestling,"3/22: probably fledged" +2022,hidden,110,rosp,2022-03-15,,2,nestling,"3/22: probably fledged" +2022,hidden,110,rosp,2022-03-16,,,,"3/22: probably fledged" +2022,hidden,110,rosp,2022-03-22,,,empty,"3/22: probably fledged" +2022,hidden,110,rosp,2022-03-29,,,empty,"3/22: probably fledged" +2022,hidden,110,rosp,2022-04-04,,,empty,"3/22: probably fledged" +2022,hidden,110,rosp,2022-04-12,,,empty,"3/22: probably fledged" +2022,hidden,110,rosp,2022-04-19,,,missed,"3/22: probably fledged" +2022,hidden,110,rosp,2022-05-03,,,empty,"3/22: probably fledged" +2022,hidden,93,greg,2022-02-23,2,,incubating,"3/22: pulled" +2022,hidden,93,greg,2022-03-01,2,,incubating,"3/22: pulled" +2022,hidden,93,greg,2022-03-08,2,,incubating,"3/22: pulled" +2022,hidden,93,greg,2022-03-15,2,,incubating,"3/22: pulled" +2022,hidden,93,greg,2022-03-16,,,,"3/22: pulled" +2022,hidden,93,greg,2022-03-22,,,empty,"3/22: pulled" +2022,hidden,93,greg,2022-03-29,,,pulled,"3/22: pulled" +2022,hidden,93,greg,2022-04-04,,,,"3/22: pulled" +2022,hidden,93,greg,2022-04-12,,,,"3/22: pulled" +2022,hidden,93,greg,2022-04-19,,,,"3/22: pulled" +2022,hidden,93,greg,2022-05-03,,,,"3/22: pulled" +2022,hidden,112,greg,2022-02-23,1,1,hatching,"4/12: big chicks, 4/19: fledgling" +2022,hidden,112,greg,2022-03-01,,2,nestling,"4/12: big chicks, 4/19: fledgling" +2022,hidden,112,greg,2022-03-08,,2,nestling,"4/12: big chicks, 4/19: fledgling" +2022,hidden,112,greg,2022-03-15,,2,nestling,"4/12: big chicks, 4/19: fledgling" +2022,hidden,112,greg,2022-03-16,,,,"4/12: big chicks, 4/19: fledgling" +2022,hidden,112,greg,2022-03-22,,2,nestling,"4/12: big chicks, 4/19: fledgling" +2022,hidden,112,greg,2022-03-29,,2,nestling,"4/12: big chicks, 4/19: fledgling" +2022,hidden,112,greg,2022-04-04,,2,nestling,"4/12: big chicks, 4/19: fledgling" +2022,hidden,112,greg,2022-04-12,,2,nestling,"4/12: big chicks, 4/19: fledgling" +2022,hidden,112,greg,2022-04-19,,1,nestling,"4/12: big chicks, 4/19: fledgling" +2022,hidden,112,greg,2022-05-03,,,empty,"4/12: big chicks, 4/19: fledgling" +2022,hidden,114,greg,2022-02-23,2,,incubating,"3/22: 2-3 days, dry" +2022,hidden,114,greg,2022-03-01,2,,incubating,"3/22: 2-3 days, dry" +2022,hidden,114,greg,2022-03-08,2,,incubating,"3/22: 2-3 days, dry" +2022,hidden,114,greg,2022-03-15,2,,incubating,"3/22: 2-3 days, dry" +2022,hidden,114,greg,2022-03-16,,,,"3/22: 2-3 days, dry" +2022,hidden,114,greg,2022-03-22,,2,nestling,"3/22: 2-3 days, dry" +2022,hidden,114,greg,2022-03-29,,2,nestling,"3/22: 2-3 days, dry" +2022,hidden,114,greg,2022-04-04,,3,nestling,"3/22: 2-3 days, dry" +2022,hidden,114,greg,2022-04-12,,,empty,"3/22: 2-3 days, dry" +2022,hidden,114,greg,2022-04-19,,,empty,"3/22: 2-3 days, dry" +2022,hidden,114,greg,2022-05-03,,,empty,"3/22: 2-3 days, dry" +2022,hidden,116,greg,2022-02-23,2,,incubating,"4/4: chick big, 4/19: fledgling" +2022,hidden,116,greg,2022-03-01,2,,incubating,"4/4: chick big, 4/19: fledgling" +2022,hidden,116,greg,2022-03-08,2,,incubating,"4/4: chick big, 4/19: fledgling" +2022,hidden,116,greg,2022-03-15,,2,nestling,"4/4: chick big, 4/19: fledgling" +2022,hidden,116,greg,2022-03-16,,,,"4/4: chick big, 4/19: fledgling" +2022,hidden,116,greg,2022-03-22,,2,nestling,"4/4: chick big, 4/19: fledgling" +2022,hidden,116,greg,2022-03-29,,2,nestling,"4/4: chick big, 4/19: fledgling" +2022,hidden,116,greg,2022-04-04,,1,nestling,"4/4: chick big, 4/19: fledgling" +2022,hidden,116,greg,2022-04-12,,1,nestling,"4/4: chick big, 4/19: fledgling" +2022,hidden,116,greg,2022-04-19,,1,nestling,"4/4: chick big, 4/19: fledgling" +2022,hidden,116,greg,2022-05-03,,,empty,"4/4: chick big, 4/19: fledgling" +2022,hidden,118,greg,2022-02-23,2,,incubating,"3/8: gone, pulled" +2022,hidden,118,greg,2022-03-01,,,empty,"3/8: gone, pulled" +2022,hidden,118,greg,2022-03-08,,,,"3/8: gone, pulled" +2022,hidden,118,greg,2022-03-15,,,,"3/8: gone, pulled" +2022,hidden,118,greg,2022-03-16,,,,"3/8: gone, pulled" +2022,hidden,118,greg,2022-03-22,,,,"3/8: gone, pulled" +2022,hidden,118,greg,2022-03-29,,,,"3/8: gone, pulled" +2022,hidden,118,greg,2022-04-04,,,,"3/8: gone, pulled" +2022,hidden,118,greg,2022-04-12,,,,"3/8: gone, pulled" +2022,hidden,118,greg,2022-04-19,,,,"3/8: gone, pulled" +2022,hidden,118,greg,2022-05-03,,,,"3/8: gone, pulled" +2022,hidden,95,greg,2022-02-23,3,,incubating,"3/8: pulled" +2022,hidden,95,greg,2022-03-01,,,empty,"3/8: pulled" +2022,hidden,95,greg,2022-03-08,,,,"3/8: pulled" +2022,hidden,95,greg,2022-03-15,,,,"3/8: pulled" +2022,hidden,95,greg,2022-03-16,,,,"3/8: pulled" +2022,hidden,95,greg,2022-03-22,,,,"3/8: pulled" +2022,hidden,95,greg,2022-03-29,,,,"3/8: pulled" +2022,hidden,95,greg,2022-04-04,,,,"3/8: pulled" +2022,hidden,95,greg,2022-04-12,,,,"3/8: pulled" +2022,hidden,95,greg,2022-04-19,,,,"3/8: pulled" +2022,hidden,95,greg,2022-05-03,,,,"3/8: pulled" +2022,hidden,97,greg,2022-02-23,2,,incubating,"3/8: 1 pipping egg, 3/15: dead vulture x3, 4/4: 2C dead in nest" +2022,hidden,97,greg,2022-03-01,3,,incubating,"3/8: 1 pipping egg, 3/15: dead vulture x3, 4/4: 2C dead in nest" +2022,hidden,97,greg,2022-03-08,3,,pipping,"3/8: 1 pipping egg, 3/15: dead vulture x3, 4/4: 2C dead in nest" +2022,hidden,97,greg,2022-03-15,,2,nestling,"3/8: 1 pipping egg, 3/15: dead vulture x3, 4/4: 2C dead in nest" +2022,hidden,97,greg,2022-03-16,,,,"3/8: 1 pipping egg, 3/15: dead vulture x3, 4/4: 2C dead in nest" +2022,hidden,97,greg,2022-03-22,1,2,hatching,"3/8: 1 pipping egg, 3/15: dead vulture x3, 4/4: 2C dead in nest" +2022,hidden,97,greg,2022-03-29,1,2,hatching,"3/8: 1 pipping egg, 3/15: dead vulture x3, 4/4: 2C dead in nest" +2022,hidden,97,greg,2022-04-04,1,,incubating,"3/8: 1 pipping egg, 3/15: dead vulture x3, 4/4: 2C dead in nest" +2022,hidden,97,greg,2022-04-12,,,missed,"3/8: 1 pipping egg, 3/15: dead vulture x3, 4/4: 2C dead in nest" +2022,hidden,97,greg,2022-04-19,,,empty,"3/8: 1 pipping egg, 3/15: dead vulture x3, 4/4: 2C dead in nest" +2022,hidden,97,greg,2022-05-03,,,empty,"3/8: 1 pipping egg, 3/15: dead vulture x3, 4/4: 2C dead in nest" +2022,hidden,120,greg,2022-02-23,3,,incubating,"3/8: gone, pulled" +2022,hidden,120,greg,2022-03-01,,,empty,"3/8: gone, pulled" +2022,hidden,120,greg,2022-03-08,,,,"3/8: gone, pulled" +2022,hidden,120,greg,2022-03-15,,,,"3/8: gone, pulled" +2022,hidden,120,greg,2022-03-16,,,,"3/8: gone, pulled" +2022,hidden,120,greg,2022-03-22,,,,"3/8: gone, pulled" +2022,hidden,120,greg,2022-03-29,,,,"3/8: gone, pulled" +2022,hidden,120,greg,2022-04-04,,,,"3/8: gone, pulled" +2022,hidden,120,greg,2022-04-12,,,,"3/8: gone, pulled" +2022,hidden,120,greg,2022-04-19,,,,"3/8: gone, pulled" +2022,hidden,120,greg,2022-05-03,,,,"3/8: gone, pulled" +2022,hidden,122,rosp,2022-02-23,3,,incubating,"3/8: chick is very precious, 4/4: 4 branchlings between 122 and 124 4/12: 2 chick branchlings between 122 and 124" +2022,hidden,122,rosp,2022-03-01,3,,incubating,"3/8: chick is very precious, 4/4: 4 branchlings between 122 and 124 4/12: 2 chick branchlings between 122 and 124" +2022,hidden,122,rosp,2022-03-08,2,1,hatching,"3/8: chick is very precious, 4/4: 4 branchlings between 122 and 124 4/12: 2 chick branchlings between 122 and 124" +2022,hidden,122,rosp,2022-03-15,,3,nestling,"3/8: chick is very precious, 4/4: 4 branchlings between 122 and 124 4/12: 2 chick branchlings between 122 and 124" +2022,hidden,122,rosp,2022-03-16,,,,"3/8: chick is very precious, 4/4: 4 branchlings between 122 and 124 4/12: 2 chick branchlings between 122 and 124" +2022,hidden,122,rosp,2022-03-22,,2,nestling,"3/8: chick is very precious, 4/4: 4 branchlings between 122 and 124 4/12: 2 chick branchlings between 122 and 124" +2022,hidden,122,rosp,2022-03-29,,2,nestling,"3/8: chick is very precious, 4/4: 4 branchlings between 122 and 124 4/12: 2 chick branchlings between 122 and 124" +2022,hidden,122,rosp,2022-04-04,,,empty,"3/8: chick is very precious, 4/4: 4 branchlings between 122 and 124 4/12: 2 chick branchlings between 122 and 124" +2022,hidden,122,rosp,2022-04-12,,,empty,"3/8: chick is very precious, 4/4: 4 branchlings between 122 and 124 4/12: 2 chick branchlings between 122 and 124" +2022,hidden,122,rosp,2022-04-19,,,empty,"3/8: chick is very precious, 4/4: 4 branchlings between 122 and 124 4/12: 2 chick branchlings between 122 and 124" +2022,hidden,122,rosp,2022-05-03,,,empty,"3/8: chick is very precious, 4/4: 4 branchlings between 122 and 124 4/12: 2 chick branchlings between 122 and 124" +2022,hidden,99,greg,2022-02-23,3,,incubating,"3/22: pulled, gone" +2022,hidden,99,greg,2022-03-01,2,,incubating,"3/22: pulled, gone" +2022,hidden,99,greg,2022-03-08,,,empty,"3/22: pulled, gone" +2022,hidden,99,greg,2022-03-15,,,,"3/22: pulled, gone" +2022,hidden,99,greg,2022-03-16,,,,"3/22: pulled, gone" +2022,hidden,99,greg,2022-03-22,,,empty,"3/22: pulled, gone" +2022,hidden,99,greg,2022-03-29,,,pulled,"3/22: pulled, gone" +2022,hidden,99,greg,2022-04-04,,,,"3/22: pulled, gone" +2022,hidden,99,greg,2022-04-12,,,,"3/22: pulled, gone" +2022,hidden,99,greg,2022-04-19,,,,"3/22: pulled, gone" +2022,hidden,99,greg,2022-05-03,,,,"3/22: pulled, gone" +2022,hidden,124,rosp,2022-02-23,3,,incubating,"3/8: wet chick, 3/22: parent present and one additional dead chick, 3/29: definitely 2 chicks alive, 4/4: 4 branchlings between 122 and 124, 4/19:gone" +2022,hidden,124,rosp,2022-03-01,3,,incubating,"3/8: wet chick, 3/22: parent present and one additional dead chick, 3/29: definitely 2 chicks alive, 4/4: 4 branchlings between 122 and 124, 4/19:gone" +2022,hidden,124,rosp,2022-03-08,2,1,wet_chick,"3/8: wet chick, 3/22: parent present and one additional dead chick, 3/29: definitely 2 chicks alive, 4/4: 4 branchlings between 122 and 124, 4/19:gone" +2022,hidden,124,rosp,2022-03-15,,3,nestling,"3/8: wet chick, 3/22: parent present and one additional dead chick, 3/29: definitely 2 chicks alive, 4/4: 4 branchlings between 122 and 124, 4/19:gone" +2022,hidden,124,rosp,2022-03-16,,,,"3/8: wet chick, 3/22: parent present and one additional dead chick, 3/29: definitely 2 chicks alive, 4/4: 4 branchlings between 122 and 124, 4/19:gone" +2022,hidden,124,rosp,2022-03-22,,1,nestling,"3/8: wet chick, 3/22: parent present and one additional dead chick, 3/29: definitely 2 chicks alive, 4/4: 4 branchlings between 122 and 124, 4/19:gone" +2022,hidden,124,rosp,2022-03-29,,2,nestling,"3/8: wet chick, 3/22: parent present and one additional dead chick, 3/29: definitely 2 chicks alive, 4/4: 4 branchlings between 122 and 124, 4/19:gone" +2022,hidden,124,rosp,2022-04-04,,,empty,"3/8: wet chick, 3/22: parent present and one additional dead chick, 3/29: definitely 2 chicks alive, 4/4: 4 branchlings between 122 and 124, 4/19:gone" +2022,hidden,124,rosp,2022-04-12,,,empty,"3/8: wet chick, 3/22: parent present and one additional dead chick, 3/29: definitely 2 chicks alive, 4/4: 4 branchlings between 122 and 124, 4/19:gone" +2022,hidden,124,rosp,2022-04-19,,,,"3/8: wet chick, 3/22: parent present and one additional dead chick, 3/29: definitely 2 chicks alive, 4/4: 4 branchlings between 122 and 124, 4/19:gone" +2022,hidden,124,rosp,2022-05-03,,,empty,"3/8: wet chick, 3/22: parent present and one additional dead chick, 3/29: definitely 2 chicks alive, 4/4: 4 branchlings between 122 and 124, 4/19:gone" +2022,hidden,101,greg,2022-02-23,2,,incubating,"3/15: dead vulture and adult egret (dead from fallen tree branch), 3/22: fuzzy, recent, 4/12: big chick" +2022,hidden,101,greg,2022-03-01,2,,incubating,"3/15: dead vulture and adult egret (dead from fallen tree branch), 3/22: fuzzy, recent, 4/12: big chick" +2022,hidden,101,greg,2022-03-08,2,,incubating,"3/15: dead vulture and adult egret (dead from fallen tree branch), 3/22: fuzzy, recent, 4/12: big chick" +2022,hidden,101,greg,2022-03-15,2,,incubating,"3/15: dead vulture and adult egret (dead from fallen tree branch), 3/22: fuzzy, recent, 4/12: big chick" +2022,hidden,101,greg,2022-03-16,,,,"3/15: dead vulture and adult egret (dead from fallen tree branch), 3/22: fuzzy, recent, 4/12: big chick" +2022,hidden,101,greg,2022-03-22,,2,nestling,"3/15: dead vulture and adult egret (dead from fallen tree branch), 3/22: fuzzy, recent, 4/12: big chick" +2022,hidden,101,greg,2022-03-29,,2,nestling,"3/15: dead vulture and adult egret (dead from fallen tree branch), 3/22: fuzzy, recent, 4/12: big chick" +2022,hidden,101,greg,2022-04-04,,2,nestling,"3/15: dead vulture and adult egret (dead from fallen tree branch), 3/22: fuzzy, recent, 4/12: big chick" +2022,hidden,101,greg,2022-04-12,,2,nestling,"3/15: dead vulture and adult egret (dead from fallen tree branch), 3/22: fuzzy, recent, 4/12: big chick" +2022,hidden,101,greg,2022-04-19,,2,nestling,"3/15: dead vulture and adult egret (dead from fallen tree branch), 3/22: fuzzy, recent, 4/12: big chick" +2022,hidden,101,greg,2022-05-03,,,empty,"3/15: dead vulture and adult egret (dead from fallen tree branch), 3/22: fuzzy, recent, 4/12: big chick" +2022,hidden,126,greg,2022-02-23,2,,incubating, +2022,hidden,126,greg,2022-03-01,2,,incubating, +2022,hidden,126,greg,2022-03-08,2,,incubating, +2022,hidden,126,greg,2022-03-15,2,,incubating, +2022,hidden,126,greg,2022-03-16,,,, +2022,hidden,126,greg,2022-03-22,,2,nestling, +2022,hidden,126,greg,2022-03-29,,2,nestling, +2022,hidden,126,greg,2022-04-04,,2,nestling, +2022,hidden,126,greg,2022-04-12,,2,nestling, +2022,hidden,126,greg,2022-04-19,,2,nestling, +2022,hidden,126,greg,2022-05-03,,,missed, +2022,hidden,103,greg,2022-02-23,3,,incubating,"3/8: gone, pulled" +2022,hidden,103,greg,2022-03-01,1,,incubating,"3/8: gone, pulled" +2022,hidden,103,greg,2022-03-08,,,empty,"3/8: gone, pulled" +2022,hidden,103,greg,2022-03-15,,,,"3/8: gone, pulled" +2022,hidden,103,greg,2022-03-16,,,,"3/8: gone, pulled" +2022,hidden,103,greg,2022-03-22,,,pulled,"3/8: gone, pulled" +2022,hidden,103,greg,2022-03-29,,,,"3/8: gone, pulled" +2022,hidden,103,greg,2022-04-04,,,,"3/8: gone, pulled" +2022,hidden,103,greg,2022-04-12,,,,"3/8: gone, pulled" +2022,hidden,103,greg,2022-04-19,,,,"3/8: gone, pulled" +2022,hidden,103,greg,2022-05-03,,,,"3/8: gone, pulled" +2022,hidden,105,greg,2022-02-23,2,,incubating,"3/22: chicks dry" +2022,hidden,105,greg,2022-03-01,2,,incubating,"3/22: chicks dry" +2022,hidden,105,greg,2022-03-08,2,,incubating,"3/22: chicks dry" +2022,hidden,105,greg,2022-03-15,2,,incubating,"3/22: chicks dry" +2022,hidden,105,greg,2022-03-16,,,,"3/22: chicks dry" +2022,hidden,105,greg,2022-03-22,,2,incubating,"3/22: chicks dry" +2022,hidden,105,greg,2022-03-29,,2,nestling,"3/22: chicks dry" +2022,hidden,105,greg,2022-04-04,,,empty,"3/22: chicks dry" +2022,hidden,105,greg,2022-04-12,,,empty,"3/22: chicks dry" +2022,hidden,105,greg,2022-04-19,,,empty,"3/22: chicks dry" +2022,hidden,105,greg,2022-05-03,,,empty,"3/22: chicks dry" +2022,hidden,128,greg,2022-02-23,,3,nestling,"2/23: chick 5 days old, 3/29: collapsed, pulled" +2022,hidden,128,greg,2022-03-01,,3,nestling,"2/23: chick 5 days old, 3/29: collapsed, pulled" +2022,hidden,128,greg,2022-03-08,,1,nestling,"2/23: chick 5 days old, 3/29: collapsed, pulled" +2022,hidden,128,greg,2022-03-15,,,empty,"2/23: chick 5 days old, 3/29: collapsed, pulled" +2022,hidden,128,greg,2022-03-16,,,,"2/23: chick 5 days old, 3/29: collapsed, pulled" +2022,hidden,128,greg,2022-03-22,,,missed,"2/23: chick 5 days old, 3/29: collapsed, pulled" +2022,hidden,128,greg,2022-03-29,,,empty,"2/23: chick 5 days old, 3/29: collapsed, pulled" +2022,hidden,128,greg,2022-04-04,,,collapsed,"2/23: chick 5 days old, 3/29: collapsed, pulled" +2022,hidden,128,greg,2022-04-12,,,,"2/23: chick 5 days old, 3/29: collapsed, pulled" +2022,hidden,128,greg,2022-04-19,,,,"2/23: chick 5 days old, 3/29: collapsed, pulled" +2022,hidden,128,greg,2022-05-03,,,,"2/23: chick 5 days old, 3/29: collapsed, pulled" +2022,hidden,107,greg,2022-02-23,3,,incubating,"3/8: second egg hatching 4/12-1 branchling present" +2022,hidden,107,greg,2022-03-01,3,,incubating,"3/8: second egg hatching 4/12-1 branchling present" +2022,hidden,107,greg,2022-03-08,2,1,hatching,"3/8: second egg hatching 4/12-1 branchling present" +2022,hidden,107,greg,2022-03-15,,3,nestling,"3/8: second egg hatching 4/12-1 branchling present" +2022,hidden,107,greg,2022-03-16,,,,"3/8: second egg hatching 4/12-1 branchling present" +2022,hidden,107,greg,2022-03-22,,3,nestling,"3/8: second egg hatching 4/12-1 branchling present" +2022,hidden,107,greg,2022-03-29,,2,nestling,"3/8: second egg hatching 4/12-1 branchling present" +2022,hidden,107,greg,2022-04-04,,2,nestling,"3/8: second egg hatching 4/12-1 branchling present" +2022,hidden,107,greg,2022-04-12,,,empty,"3/8: second egg hatching 4/12-1 branchling present" +2022,hidden,107,greg,2022-04-19,,,empty,"3/8: second egg hatching 4/12-1 branchling present" +2022,hidden,107,greg,2022-05-03,,,empty,"3/8: second egg hatching 4/12-1 branchling present" +2022,hidden,130,greg,2022-02-23,3,,incubating,"3/15: gone, pulled" +2022,hidden,130,greg,2022-03-01,,,missed,"3/15: gone, pulled" +2022,hidden,130,greg,2022-03-08,,,missed,"3/15: gone, pulled" +2022,hidden,130,greg,2022-03-15,,,empty,"3/15: gone, pulled" +2022,hidden,130,greg,2022-03-16,,,,"3/15: gone, pulled" +2022,hidden,130,greg,2022-03-22,,,,"3/15: gone, pulled" +2022,hidden,130,greg,2022-03-29,,,,"3/15: gone, pulled" +2022,hidden,130,greg,2022-04-04,,,,"3/15: gone, pulled" +2022,hidden,130,greg,2022-04-12,,,,"3/15: gone, pulled" +2022,hidden,130,greg,2022-04-19,,,,"3/15: gone, pulled" +2022,hidden,130,greg,2022-05-03,,,,"3/15: gone, pulled" +2022,hidden,109,greg,2022-02-23,2,,incubating,"3/15: gone, pulled" +2022,hidden,109,greg,2022-03-01,1,,incubating,"3/15: gone, pulled" +2022,hidden,109,greg,2022-03-08,2,,incubating,"3/15: gone, pulled" +2022,hidden,109,greg,2022-03-15,,,empty,"3/15: gone, pulled" +2022,hidden,109,greg,2022-03-16,,,,"3/15: gone, pulled" +2022,hidden,109,greg,2022-03-22,,,,"3/15: gone, pulled" +2022,hidden,109,greg,2022-03-29,,,,"3/15: gone, pulled" +2022,hidden,109,greg,2022-04-04,,,,"3/15: gone, pulled" +2022,hidden,109,greg,2022-04-12,,,,"3/15: gone, pulled" +2022,hidden,109,greg,2022-04-19,,,,"3/15: gone, pulled" +2022,hidden,109,greg,2022-05-03,,,,"3/15: gone, pulled" +2022,hidden,111,rosp,2022-02-23,1,,incubating,"3/15: dead adult?, 4/19: pulled" +2022,hidden,111,rosp,2022-03-01,1,,incubating,"3/15: dead adult?, 4/19: pulled" +2022,hidden,111,rosp,2022-03-08,,,empty,"3/15: dead adult?, 4/19: pulled" +2022,hidden,111,rosp,2022-03-15,1,,incubating,"3/15: dead adult?, 4/19: pulled" +2022,hidden,111,rosp,2022-03-16,,,,"3/15: dead adult?, 4/19: pulled" +2022,hidden,111,rosp,2022-03-22,,,empty,"3/15: dead adult?, 4/19: pulled" +2022,hidden,111,rosp,2022-03-29,,,empty,"3/15: dead adult?, 4/19: pulled" +2022,hidden,111,rosp,2022-04-04,,,empty,"3/15: dead adult?, 4/19: pulled" +2022,hidden,111,rosp,2022-04-12,,,empty,"3/15: dead adult?, 4/19: pulled" +2022,hidden,111,rosp,2022-04-19,,,pulled,"3/15: dead adult?, 4/19: pulled" +2022,hidden,111,rosp,2022-05-03,,,,"3/15: dead adult?, 4/19: pulled" +2022,hidden,132,rosp,2022-02-23,1,1,hatching,"2/23: chick is large, 3/15: dead vulture, 3/29: mature dead ROSP chick beneath on ground" +2022,hidden,132,rosp,2022-03-01,1,1,hatching,"2/23: chick is large, 3/15: dead vulture, 3/29: mature dead ROSP chick beneath on ground" +2022,hidden,132,rosp,2022-03-08,,1,nestling,"2/23: chick is large, 3/15: dead vulture, 3/29: mature dead ROSP chick beneath on ground" +2022,hidden,132,rosp,2022-03-15,,,empty,"2/23: chick is large, 3/15: dead vulture, 3/29: mature dead ROSP chick beneath on ground" +2022,hidden,132,rosp,2022-03-16,,,,"2/23: chick is large, 3/15: dead vulture, 3/29: mature dead ROSP chick beneath on ground" +2022,hidden,132,rosp,2022-03-22,,,empty,"2/23: chick is large, 3/15: dead vulture, 3/29: mature dead ROSP chick beneath on ground" +2022,hidden,132,rosp,2022-03-29,,,empty,"2/23: chick is large, 3/15: dead vulture, 3/29: mature dead ROSP chick beneath on ground" +2022,hidden,132,rosp,2022-04-04,,,empty,"2/23: chick is large, 3/15: dead vulture, 3/29: mature dead ROSP chick beneath on ground" +2022,hidden,132,rosp,2022-04-12,,,empty,"2/23: chick is large, 3/15: dead vulture, 3/29: mature dead ROSP chick beneath on ground" +2022,hidden,132,rosp,2022-04-19,,,empty,"2/23: chick is large, 3/15: dead vulture, 3/29: mature dead ROSP chick beneath on ground" +2022,hidden,132,rosp,2022-05-03,,,empty,"2/23: chick is large, 3/15: dead vulture, 3/29: mature dead ROSP chick beneath on ground" +2022,hidden,113,greg,2022-02-23,2,,incubating,"4/12: one branchling present" +2022,hidden,113,greg,2022-03-01,2,,incubating,"4/12: one branchling present" +2022,hidden,113,greg,2022-03-08,2,,incubating,"4/12: one branchling present" +2022,hidden,113,greg,2022-03-15,,2,nestling,"4/12: one branchling present" +2022,hidden,113,greg,2022-03-16,,,,"4/12: one branchling present" +2022,hidden,113,greg,2022-03-22,,2,nestling,"4/12: one branchling present" +2022,hidden,113,greg,2022-03-29,,2,nestling,"4/12: one branchling present" +2022,hidden,113,greg,2022-04-04,,1,nestling,"4/12: one branchling present" +2022,hidden,113,greg,2022-04-12,,,empty,"4/12: one branchling present" +2022,hidden,113,greg,2022-04-19,,,empty,"4/12: one branchling present" +2022,hidden,113,greg,2022-05-03,,,missed,"4/12: one branchling present" +2022,hidden,134,rosp,2022-02-23,,2,nestling,"2/23: chick 1 week old, 4/19: pulled" +2022,hidden,134,rosp,2022-03-01,,2,nestling,"2/23: chick 1 week old, 4/19: pulled" +2022,hidden,134,rosp,2022-03-08,,2,nestling,"2/23: chick 1 week old, 4/19: pulled" +2022,hidden,134,rosp,2022-03-15,,2,nestling,"2/23: chick 1 week old, 4/19: pulled" +2022,hidden,134,rosp,2022-03-16,,,,"2/23: chick 1 week old, 4/19: pulled" +2022,hidden,134,rosp,2022-03-22,,,empty,"2/23: chick 1 week old, 4/19: pulled" +2022,hidden,134,rosp,2022-03-29,,,empty,"2/23: chick 1 week old, 4/19: pulled" +2022,hidden,134,rosp,2022-04-04,,,empty,"2/23: chick 1 week old, 4/19: pulled" +2022,hidden,134,rosp,2022-04-12,,,empty,"2/23: chick 1 week old, 4/19: pulled" +2022,hidden,134,rosp,2022-04-19,,,pulled,"2/23: chick 1 week old, 4/19: pulled" +2022,hidden,134,rosp,2022-05-03,,,,"2/23: chick 1 week old, 4/19: pulled" +2022,hidden,136,rosp,2022-02-23,,2,nestling,"2/23: chick 1 week old, 3/29: dead chick below it" +2022,hidden,136,rosp,2022-03-01,,1,nestling,"2/23: chick 1 week old, 3/29: dead chick below it" +2022,hidden,136,rosp,2022-03-08,,1,nestling,"2/23: chick 1 week old, 3/29: dead chick below it" +2022,hidden,136,rosp,2022-03-15,,,empty,"2/23: chick 1 week old, 3/29: dead chick below it" +2022,hidden,136,rosp,2022-03-16,,,,"2/23: chick 1 week old, 3/29: dead chick below it" +2022,hidden,136,rosp,2022-03-22,,,missed,"2/23: chick 1 week old, 3/29: dead chick below it" +2022,hidden,136,rosp,2022-03-29,,,empty,"2/23: chick 1 week old, 3/29: dead chick below it" +2022,hidden,136,rosp,2022-04-04,,,empty,"2/23: chick 1 week old, 3/29: dead chick below it" +2022,hidden,136,rosp,2022-04-12,,,empty,"2/23: chick 1 week old, 3/29: dead chick below it" +2022,hidden,136,rosp,2022-04-19,,,empty,"2/23: chick 1 week old, 3/29: dead chick below it" +2022,hidden,136,rosp,2022-05-03,,,missed,"2/23: chick 1 week old, 3/29: dead chick below it" +2022,hidden,115,rosp,2022-02-23,,3,nestling,"2/23: chick 1 week old, 3/22: 5 fledglings near 115 and 121" +2022,hidden,115,rosp,2022-03-01,,3,nestling,"2/23: chick 1 week old, 3/22: 5 fledglings near 115 and 121" +2022,hidden,115,rosp,2022-03-08,,3,nestling,"2/23: chick 1 week old, 3/22: 5 fledglings near 115 and 121" +2022,hidden,115,rosp,2022-03-15,,3,nestling,"2/23: chick 1 week old, 3/22: 5 fledglings near 115 and 121" +2022,hidden,115,rosp,2022-03-16,,,,"2/23: chick 1 week old, 3/22: 5 fledglings near 115 and 121" +2022,hidden,115,rosp,2022-03-22,,,empty,"2/23: chick 1 week old, 3/22: 5 fledglings near 115 and 121" +2022,hidden,115,rosp,2022-03-29,,,empty,"2/23: chick 1 week old, 3/22: 5 fledglings near 115 and 121" +2022,hidden,115,rosp,2022-04-04,,,empty,"2/23: chick 1 week old, 3/22: 5 fledglings near 115 and 121" +2022,hidden,115,rosp,2022-04-12,,,empty,"2/23: chick 1 week old, 3/22: 5 fledglings near 115 and 121" +2022,hidden,115,rosp,2022-04-19,,,empty,"2/23: chick 1 week old, 3/22: 5 fledglings near 115 and 121" +2022,hidden,115,rosp,2022-05-03,,,empty,"2/23: chick 1 week old, 3/22: 5 fledglings near 115 and 121" +2022,hidden,138,greg,2022-02-23,2,,incubating,"3/29: collapsed, pulled" +2022,hidden,138,greg,2022-03-01,,,empty,"3/29: collapsed, pulled" +2022,hidden,138,greg,2022-03-08,,,missed,"3/29: collapsed, pulled" +2022,hidden,138,greg,2022-03-15,2,,incubating,"3/29: collapsed, pulled" +2022,hidden,138,greg,2022-03-16,,,,"3/29: collapsed, pulled" +2022,hidden,138,greg,2022-03-22,,,empty,"3/29: collapsed, pulled" +2022,hidden,138,greg,2022-03-29,,,collapsed,"3/29: collapsed, pulled" +2022,hidden,138,greg,2022-04-04,,,pulled,"3/29: collapsed, pulled" +2022,hidden,138,greg,2022-04-12,,,,"3/29: collapsed, pulled" +2022,hidden,138,greg,2022-04-19,,,,"3/29: collapsed, pulled" +2022,hidden,138,greg,2022-05-03,,,,"3/29: collapsed, pulled" +2022,hidden,117,rosp,2022-02-23,,3,nestling,"2/23: chick 4 days old; 3/1: 1 dead chick hanging, 3/8: big chick, running from nest, 3/22: 3 fledglings above 117 and 119" +2022,hidden,117,rosp,2022-03-01,,,empty,"2/23: chick 4 days old; 3/1: 1 dead chick hanging, 3/8: big chick, running from nest, 3/22: 3 fledglings above 117 and 119" +2022,hidden,117,rosp,2022-03-08,,1,nestling,"2/23: chick 4 days old; 3/1: 1 dead chick hanging, 3/8: big chick, running from nest, 3/22: 3 fledglings above 117 and 119" +2022,hidden,117,rosp,2022-03-15,,,empty,"2/23: chick 4 days old; 3/1: 1 dead chick hanging, 3/8: big chick, running from nest, 3/22: 3 fledglings above 117 and 119" +2022,hidden,117,rosp,2022-03-16,,,,"2/23: chick 4 days old; 3/1: 1 dead chick hanging, 3/8: big chick, running from nest, 3/22: 3 fledglings above 117 and 119" +2022,hidden,117,rosp,2022-03-22,,,empty,"2/23: chick 4 days old; 3/1: 1 dead chick hanging, 3/8: big chick, running from nest, 3/22: 3 fledglings above 117 and 119" +2022,hidden,117,rosp,2022-03-29,,,empty,"2/23: chick 4 days old; 3/1: 1 dead chick hanging, 3/8: big chick, running from nest, 3/22: 3 fledglings above 117 and 119" +2022,hidden,117,rosp,2022-04-04,,,empty,"2/23: chick 4 days old; 3/1: 1 dead chick hanging, 3/8: big chick, running from nest, 3/22: 3 fledglings above 117 and 119" +2022,hidden,117,rosp,2022-04-12,,,empty,"2/23: chick 4 days old; 3/1: 1 dead chick hanging, 3/8: big chick, running from nest, 3/22: 3 fledglings above 117 and 119" +2022,hidden,117,rosp,2022-04-19,,,empty,"2/23: chick 4 days old; 3/1: 1 dead chick hanging, 3/8: big chick, running from nest, 3/22: 3 fledglings above 117 and 119" +2022,hidden,117,rosp,2022-05-03,,,missed,"2/23: chick 4 days old; 3/1: 1 dead chick hanging, 3/8: big chick, running from nest, 3/22: 3 fledglings above 117 and 119" +2022,hidden,119,rosp,2022-02-23,,2,nestling,"2/23: chick 4 days old, 3/8: big chick, running from nest, 3/22: 3 fledglings above 117 and 119" +2022,hidden,119,rosp,2022-03-01,,1,nestling,"2/23: chick 4 days old, 3/8: big chick, running from nest, 3/22: 3 fledglings above 117 and 119" +2022,hidden,119,rosp,2022-03-08,,2,nestling,"2/23: chick 4 days old, 3/8: big chick, running from nest, 3/22: 3 fledglings above 117 and 119" +2022,hidden,119,rosp,2022-03-15,,2,nestling,"2/23: chick 4 days old, 3/8: big chick, running from nest, 3/22: 3 fledglings above 117 and 119" +2022,hidden,119,rosp,2022-03-16,,,,"2/23: chick 4 days old, 3/8: big chick, running from nest, 3/22: 3 fledglings above 117 and 119" +2022,hidden,119,rosp,2022-03-22,,,empty,"2/23: chick 4 days old, 3/8: big chick, running from nest, 3/22: 3 fledglings above 117 and 119" +2022,hidden,119,rosp,2022-03-29,,,empty,"2/23: chick 4 days old, 3/8: big chick, running from nest, 3/22: 3 fledglings above 117 and 119" +2022,hidden,119,rosp,2022-04-04,,,empty,"2/23: chick 4 days old, 3/8: big chick, running from nest, 3/22: 3 fledglings above 117 and 119" +2022,hidden,119,rosp,2022-04-12,,,empty,"2/23: chick 4 days old, 3/8: big chick, running from nest, 3/22: 3 fledglings above 117 and 119" +2022,hidden,119,rosp,2022-04-19,,,empty,"2/23: chick 4 days old, 3/8: big chick, running from nest, 3/22: 3 fledglings above 117 and 119" +2022,hidden,119,rosp,2022-05-03,,,missed,"2/23: chick 4 days old, 3/8: big chick, running from nest, 3/22: 3 fledglings above 117 and 119" +2022,hidden,140,rosp,2022-02-23,2,1,hatching,"2/23: chick dry" +2022,hidden,140,rosp,2022-03-01,,3,nestling,"2/23: chick dry" +2022,hidden,140,rosp,2022-03-08,,3,nestling,"2/23: chick dry" +2022,hidden,140,rosp,2022-03-15,,2,nestling,"2/23: chick dry" +2022,hidden,140,rosp,2022-03-16,,,,"2/23: chick dry" +2022,hidden,140,rosp,2022-03-22,,1,nestling,"2/23: chick dry" +2022,hidden,140,rosp,2022-03-29,,,empty,"2/23: chick dry" +2022,hidden,140,rosp,2022-04-04,,,empty,"2/23: chick dry" +2022,hidden,140,rosp,2022-04-12,,,empty,"2/23: chick dry" +2022,hidden,140,rosp,2022-04-19,,,empty,"2/23: chick dry" +2022,hidden,140,rosp,2022-05-03,,,missed,"2/23: chick dry" +2022,hidden,142,greg,2022-02-23,3,,incubating,"3/8: gone, pulled" +2022,hidden,142,greg,2022-03-01,,,empty,"3/8: gone, pulled" +2022,hidden,142,greg,2022-03-08,,,,"3/8: gone, pulled" +2022,hidden,142,greg,2022-03-15,,,,"3/8: gone, pulled" +2022,hidden,142,greg,2022-03-16,,,,"3/8: gone, pulled" +2022,hidden,142,greg,2022-03-22,,,,"3/8: gone, pulled" +2022,hidden,142,greg,2022-03-29,,,,"3/8: gone, pulled" +2022,hidden,142,greg,2022-04-04,,,,"3/8: gone, pulled" +2022,hidden,142,greg,2022-04-12,,,,"3/8: gone, pulled" +2022,hidden,142,greg,2022-04-19,,,,"3/8: gone, pulled" +2022,hidden,142,greg,2022-05-03,,,,"3/8: gone, pulled" +2022,hidden,121,rosp,2022-02-23,1,2,hatching,"2/23: chick dry; 3/22: 5 fledglings near 115 and 121" +2022,hidden,121,rosp,2022-03-01,,3,nestling,"2/23: chick dry; 3/22: 5 fledglings near 115 and 121" +2022,hidden,121,rosp,2022-03-08,,3,nestling,"2/23: chick dry; 3/22: 5 fledglings near 115 and 121" +2022,hidden,121,rosp,2022-03-15,,3,nestling,"2/23: chick dry; 3/22: 5 fledglings near 115 and 121" +2022,hidden,121,rosp,2022-03-16,,,,"2/23: chick dry; 3/22: 5 fledglings near 115 and 121" +2022,hidden,121,rosp,2022-03-22,,,empty,"2/23: chick dry; 3/22: 5 fledglings near 115 and 121" +2022,hidden,121,rosp,2022-03-29,,,empty,"2/23: chick dry; 3/22: 5 fledglings near 115 and 121" +2022,hidden,121,rosp,2022-04-04,,,empty,"2/23: chick dry; 3/22: 5 fledglings near 115 and 121" +2022,hidden,121,rosp,2022-04-12,,,empty,"2/23: chick dry; 3/22: 5 fledglings near 115 and 121" +2022,hidden,121,rosp,2022-04-19,,,empty,"2/23: chick dry; 3/22: 5 fledglings near 115 and 121" +2022,hidden,121,rosp,2022-05-03,,,empty,"2/23: chick dry; 3/22: 5 fledglings near 115 and 121" +2022,hidden,144,greg,2022-02-23,2,,incubating,"3/22: pulled" +2022,hidden,144,greg,2022-03-01,,,empty,"3/22: pulled" +2022,hidden,144,greg,2022-03-08,,,missed,"3/22: pulled" +2022,hidden,144,greg,2022-03-15,,,empty,"3/22: pulled" +2022,hidden,144,greg,2022-03-16,,,,"3/22: pulled" +2022,hidden,144,greg,2022-03-22,,,,"3/22: pulled" +2022,hidden,144,greg,2022-03-29,,,,"3/22: pulled" +2022,hidden,144,greg,2022-04-04,,,,"3/22: pulled" +2022,hidden,144,greg,2022-04-12,,,,"3/22: pulled" +2022,hidden,144,greg,2022-04-19,,,,"3/22: pulled" +2022,hidden,144,greg,2022-05-03,,,,"3/22: pulled" +2022,hidden,123,rosp,2022-02-23,3,,incubating,"3/15: dead vulture, 3/29: 5 branchlings total above 123 and 148, but 2 may be from unmarked nest" +2022,hidden,123,rosp,2022-03-01,1,2,hatching,"3/15: dead vulture, 3/29: 5 branchlings total above 123 and 148, but 2 may be from unmarked nest" +2022,hidden,123,rosp,2022-03-08,1,2,hatching,"3/15: dead vulture, 3/29: 5 branchlings total above 123 and 148, but 2 may be from unmarked nest" +2022,hidden,123,rosp,2022-03-15,,2,nestling,"3/15: dead vulture, 3/29: 5 branchlings total above 123 and 148, but 2 may be from unmarked nest" +2022,hidden,123,rosp,2022-03-16,,,,"3/15: dead vulture, 3/29: 5 branchlings total above 123 and 148, but 2 may be from unmarked nest" +2022,hidden,123,rosp,2022-03-22,,2,nestling,"3/15: dead vulture, 3/29: 5 branchlings total above 123 and 148, but 2 may be from unmarked nest" +2022,hidden,123,rosp,2022-03-29,,,empty,"3/15: dead vulture, 3/29: 5 branchlings total above 123 and 148, but 2 may be from unmarked nest" +2022,hidden,123,rosp,2022-04-04,,,empty,"3/15: dead vulture, 3/29: 5 branchlings total above 123 and 148, but 2 may be from unmarked nest" +2022,hidden,123,rosp,2022-04-12,,,empty,"3/15: dead vulture, 3/29: 5 branchlings total above 123 and 148, but 2 may be from unmarked nest" +2022,hidden,123,rosp,2022-04-19,,,empty,"3/15: dead vulture, 3/29: 5 branchlings total above 123 and 148, but 2 may be from unmarked nest" +2022,hidden,123,rosp,2022-05-03,,,empty,"3/15: dead vulture, 3/29: 5 branchlings total above 123 and 148, but 2 may be from unmarked nest" +2022,hidden,146,rosp,2022-02-23,3,,incubating,"3/29: 3 branchlings" +2022,hidden,146,rosp,2022-03-01,3,,incubating,"3/29: 3 branchlings" +2022,hidden,146,rosp,2022-03-08,,3,nestling,"3/29: 3 branchlings" +2022,hidden,146,rosp,2022-03-15,,,missed,"3/29: 3 branchlings" +2022,hidden,146,rosp,2022-03-16,,,,"3/29: 3 branchlings" +2022,hidden,146,rosp,2022-03-22,,3,nestling,"3/29: 3 branchlings" +2022,hidden,146,rosp,2022-03-29,,,empty,"3/29: 3 branchlings" +2022,hidden,146,rosp,2022-04-04,,,empty,"3/29: 3 branchlings" +2022,hidden,146,rosp,2022-04-12,,,empty,"3/29: 3 branchlings" +2022,hidden,146,rosp,2022-04-19,,,empty,"3/29: 3 branchlings" +2022,hidden,146,rosp,2022-05-03,,,empty,"3/29: 3 branchlings" +2022,hidden,148,rosp,2022-02-23,3,,incubating,"3/1: one egg pipping, 3/29: 5 branchlings total above 123 and 148, but 2 may be from unmarked nest" +2022,hidden,148,rosp,2022-03-01,3,,pipping,"3/1: one egg pipping, 3/29: 5 branchlings total above 123 and 148, but 2 may be from unmarked nest" +2022,hidden,148,rosp,2022-03-08,,3,nestling,"3/1: one egg pipping, 3/29: 5 branchlings total above 123 and 148, but 2 may be from unmarked nest" +2022,hidden,148,rosp,2022-03-15,,3,nestling,"3/1: one egg pipping, 3/29: 5 branchlings total above 123 and 148, but 2 may be from unmarked nest" +2022,hidden,148,rosp,2022-03-16,,,,"3/1: one egg pipping, 3/29: 5 branchlings total above 123 and 148, but 2 may be from unmarked nest" +2022,hidden,148,rosp,2022-03-22,,3,nestling,"3/1: one egg pipping, 3/29: 5 branchlings total above 123 and 148, but 2 may be from unmarked nest" +2022,hidden,148,rosp,2022-03-29,,,empty,"3/1: one egg pipping, 3/29: 5 branchlings total above 123 and 148, but 2 may be from unmarked nest" +2022,hidden,148,rosp,2022-04-04,,,empty,"3/1: one egg pipping, 3/29: 5 branchlings total above 123 and 148, but 2 may be from unmarked nest" +2022,hidden,148,rosp,2022-04-12,,,empty,"3/1: one egg pipping, 3/29: 5 branchlings total above 123 and 148, but 2 may be from unmarked nest" +2022,hidden,148,rosp,2022-04-19,,,empty,"3/1: one egg pipping, 3/29: 5 branchlings total above 123 and 148, but 2 may be from unmarked nest" +2022,hidden,148,rosp,2022-05-03,,,empty,"3/1: one egg pipping, 3/29: 5 branchlings total above 123 and 148, but 2 may be from unmarked nest" +2022,hidden,160,greg,2022-02-23,2,,incubating,"3/1: freshly broken eggs on ground" +2022,hidden,160,greg,2022-03-01,,,empty,"3/1: freshly broken eggs on ground" +2022,hidden,160,greg,2022-03-08,,,empty,"3/1: freshly broken eggs on ground" +2022,hidden,160,greg,2022-03-15,1,,incubating,"3/1: freshly broken eggs on ground" +2022,hidden,160,greg,2022-03-16,,,,"3/1: freshly broken eggs on ground" +2022,hidden,160,greg,2022-03-22,2,,incubating,"3/1: freshly broken eggs on ground" +2022,hidden,160,greg,2022-03-29,,,empty,"3/1: freshly broken eggs on ground" +2022,hidden,160,greg,2022-04-04,,,empty,"3/1: freshly broken eggs on ground" +2022,hidden,160,greg,2022-04-12,,,empty,"3/1: freshly broken eggs on ground" +2022,hidden,160,greg,2022-04-19,,,empty,"3/1: freshly broken eggs on ground" +2022,hidden,160,greg,2022-05-03,,,empty,"3/1: freshly broken eggs on ground" +2022,hidden,162,greg,2022-02-23,2,,incubating,"3/8: gone, pulled" +2022,hidden,162,greg,2022-03-01,,,empty,"3/8: gone, pulled" +2022,hidden,162,greg,2022-03-08,,,,"3/8: gone, pulled" +2022,hidden,162,greg,2022-03-15,,,,"3/8: gone, pulled" +2022,hidden,162,greg,2022-03-16,,,,"3/8: gone, pulled" +2022,hidden,162,greg,2022-03-22,,,,"3/8: gone, pulled" +2022,hidden,162,greg,2022-03-29,,,empty,"3/8: gone, pulled" +2022,hidden,162,greg,2022-04-04,,,,"3/8: gone, pulled" +2022,hidden,162,greg,2022-04-12,,,,"3/8: gone, pulled" +2022,hidden,162,greg,2022-04-19,,,,"3/8: gone, pulled" +2022,hidden,162,greg,2022-05-03,,,,"3/8: gone, pulled" +2022,hidden,150,anhi,2022-02-23,4,,incubating,"Off to the side, 3/8: ANHI, pulled" +2022,hidden,150,anhi,2022-03-01,,,missed,"Off to the side, 3/8: ANHI, pulled" +2022,hidden,150,anhi,2022-03-08,,,,"Off to the side, 3/8: ANHI, pulled" +2022,hidden,150,anhi,2022-03-15,,,,"Off to the side, 3/8: ANHI, pulled" +2022,hidden,150,anhi,2022-03-16,,,,"Off to the side, 3/8: ANHI, pulled" +2022,hidden,150,anhi,2022-03-22,,,,"Off to the side, 3/8: ANHI, pulled" +2022,hidden,150,anhi,2022-03-29,,,,"Off to the side, 3/8: ANHI, pulled" +2022,hidden,150,anhi,2022-04-04,,,,"Off to the side, 3/8: ANHI, pulled" +2022,hidden,150,anhi,2022-04-12,,,,"Off to the side, 3/8: ANHI, pulled" +2022,hidden,150,anhi,2022-04-19,,,,"Off to the side, 3/8: ANHI, pulled" +2022,hidden,150,anhi,2022-05-03,,,,"Off to the side, 3/8: ANHI, pulled" +2022,hidden,164,greg,2022-02-23,2,,incubating,"3/8: pulled" +2022,hidden,164,greg,2022-03-01,,,empty,"3/8: pulled" +2022,hidden,164,greg,2022-03-08,,,,"3/8: pulled" +2022,hidden,164,greg,2022-03-15,,,,"3/8: pulled" +2022,hidden,164,greg,2022-03-16,,,,"3/8: pulled" +2022,hidden,164,greg,2022-03-22,,,,"3/8: pulled" +2022,hidden,164,greg,2022-03-29,,,,"3/8: pulled" +2022,hidden,164,greg,2022-04-04,,,,"3/8: pulled" +2022,hidden,164,greg,2022-04-12,,,,"3/8: pulled" +2022,hidden,164,greg,2022-04-19,,,,"3/8: pulled" +2022,hidden,164,greg,2022-05-03,,,,"3/8: pulled" +2022,hidden,166,rosp,2022-02-23,1,2,hatching,"3/8: 3rd chick present but dead, 3/22: fledged, 3/29: 3 branchlings between 166 and 192, 4/4: 2 branchlings way high" +2022,hidden,166,rosp,2022-03-01,,3,nestling,"3/8: 3rd chick present but dead, 3/22: fledged, 3/29: 3 branchlings between 166 and 192, 4/4: 2 branchlings way high" +2022,hidden,166,rosp,2022-03-08,,2,nestling,"3/8: 3rd chick present but dead, 3/22: fledged, 3/29: 3 branchlings between 166 and 192, 4/4: 2 branchlings way high" +2022,hidden,166,rosp,2022-03-15,,2,nestling,"3/8: 3rd chick present but dead, 3/22: fledged, 3/29: 3 branchlings between 166 and 192, 4/4: 2 branchlings way high" +2022,hidden,166,rosp,2022-03-16,,,,"3/8: 3rd chick present but dead, 3/22: fledged, 3/29: 3 branchlings between 166 and 192, 4/4: 2 branchlings way high" +2022,hidden,166,rosp,2022-03-22,,2,nestling,"3/8: 3rd chick present but dead, 3/22: fledged, 3/29: 3 branchlings between 166 and 192, 4/4: 2 branchlings way high" +2022,hidden,166,rosp,2022-03-29,,,empty,"3/8: 3rd chick present but dead, 3/22: fledged, 3/29: 3 branchlings between 166 and 192, 4/4: 2 branchlings way high" +2022,hidden,166,rosp,2022-04-04,,,empty,"3/8: 3rd chick present but dead, 3/22: fledged, 3/29: 3 branchlings between 166 and 192, 4/4: 2 branchlings way high" +2022,hidden,166,rosp,2022-04-12,,,empty,"3/8: 3rd chick present but dead, 3/22: fledged, 3/29: 3 branchlings between 166 and 192, 4/4: 2 branchlings way high" +2022,hidden,166,rosp,2022-04-19,,,empty,"3/8: 3rd chick present but dead, 3/22: fledged, 3/29: 3 branchlings between 166 and 192, 4/4: 2 branchlings way high" +2022,hidden,166,rosp,2022-05-03,,,empty,"3/8: 3rd chick present but dead, 3/22: fledged, 3/29: 3 branchlings between 166 and 192, 4/4: 2 branchlings way high" +2022,hidden,152,greg,2022-02-23,2,,incubating,"3/8: chick dry" +2022,hidden,152,greg,2022-03-01,2,,incubating,"3/8: chick dry" +2022,hidden,152,greg,2022-03-08,1,1,hatching,"3/8: chick dry" +2022,hidden,152,greg,2022-03-15,,,empty,"3/8: chick dry" +2022,hidden,152,greg,2022-03-16,,,,"3/8: chick dry" +2022,hidden,152,greg,2022-03-22,,,empty,"3/8: chick dry" +2022,hidden,152,greg,2022-03-29,,,empty,"3/8: chick dry" +2022,hidden,152,greg,2022-04-04,,,empty,"3/8: chick dry" +2022,hidden,152,greg,2022-04-12,,,empty,"3/8: chick dry" +2022,hidden,152,greg,2022-04-19,,,empty,"3/8: chick dry" +2022,hidden,152,greg,2022-05-03,,,empty,"3/8: chick dry" +2022,hidden,154,rosp,2022-02-23,3,,incubating,"3/22: one additional dead chick, 3/29: collapsed but 1 branchling, 4/4: dead chick on ground, 4/19: gone" +2022,hidden,154,rosp,2022-03-01,3,,incubating,"3/22: one additional dead chick, 3/29: collapsed but 1 branchling, 4/4: dead chick on ground, 4/19: gone" +2022,hidden,154,rosp,2022-03-08,,3,nestling,"3/22: one additional dead chick, 3/29: collapsed but 1 branchling, 4/4: dead chick on ground, 4/19: gone" +2022,hidden,154,rosp,2022-03-15,,3,nestling,"3/22: one additional dead chick, 3/29: collapsed but 1 branchling, 4/4: dead chick on ground, 4/19: gone" +2022,hidden,154,rosp,2022-03-16,,,,"3/22: one additional dead chick, 3/29: collapsed but 1 branchling, 4/4: dead chick on ground, 4/19: gone" +2022,hidden,154,rosp,2022-03-22,,2,nestling,"3/22: one additional dead chick, 3/29: collapsed but 1 branchling, 4/4: dead chick on ground, 4/19: gone" +2022,hidden,154,rosp,2022-03-29,,1,branchling,"3/22: one additional dead chick, 3/29: collapsed but 1 branchling, 4/4: dead chick on ground, 4/19: gone" +2022,hidden,154,rosp,2022-04-04,,,collapsed,"3/22: one additional dead chick, 3/29: collapsed but 1 branchling, 4/4: dead chick on ground, 4/19: gone" +2022,hidden,154,rosp,2022-04-12,,,collapsed,"3/22: one additional dead chick, 3/29: collapsed but 1 branchling, 4/4: dead chick on ground, 4/19: gone" +2022,hidden,154,rosp,2022-04-19,,,,"3/22: one additional dead chick, 3/29: collapsed but 1 branchling, 4/4: dead chick on ground, 4/19: gone" +2022,hidden,154,rosp,2022-05-03,,,,"3/22: one additional dead chick, 3/29: collapsed but 1 branchling, 4/4: dead chick on ground, 4/19: gone" +2022,hidden,168,rosp,2022-02-23,3,,incubating,"3/29: 4 branchlings between 168 and 170 (smaller), 4/4: 170, 168, 176 have ROSP chick feathers on ground (dead--flight feathers)" +2022,hidden,168,rosp,2022-03-01,3,,incubating,"3/29: 4 branchlings between 168 and 170 (smaller), 4/4: 170, 168, 176 have ROSP chick feathers on ground (dead--flight feathers)" +2022,hidden,168,rosp,2022-03-08,1,2,hatching,"3/29: 4 branchlings between 168 and 170 (smaller), 4/4: 170, 168, 176 have ROSP chick feathers on ground (dead--flight feathers)" +2022,hidden,168,rosp,2022-03-15,1,2,hatching,"3/29: 4 branchlings between 168 and 170 (smaller), 4/4: 170, 168, 176 have ROSP chick feathers on ground (dead--flight feathers)" +2022,hidden,168,rosp,2022-03-16,,,,"3/29: 4 branchlings between 168 and 170 (smaller), 4/4: 170, 168, 176 have ROSP chick feathers on ground (dead--flight feathers)" +2022,hidden,168,rosp,2022-03-22,,2,nestling,"3/29: 4 branchlings between 168 and 170 (smaller), 4/4: 170, 168, 176 have ROSP chick feathers on ground (dead--flight feathers)" +2022,hidden,168,rosp,2022-03-29,,,empty,"3/29: 4 branchlings between 168 and 170 (smaller), 4/4: 170, 168, 176 have ROSP chick feathers on ground (dead--flight feathers)" +2022,hidden,168,rosp,2022-04-04,,,empty,"3/29: 4 branchlings between 168 and 170 (smaller), 4/4: 170, 168, 176 have ROSP chick feathers on ground (dead--flight feathers)" +2022,hidden,168,rosp,2022-04-12,,,,"3/29: 4 branchlings between 168 and 170 (smaller), 4/4: 170, 168, 176 have ROSP chick feathers on ground (dead--flight feathers)" +2022,hidden,168,rosp,2022-04-19,,,empty,"3/29: 4 branchlings between 168 and 170 (smaller), 4/4: 170, 168, 176 have ROSP chick feathers on ground (dead--flight feathers)" +2022,hidden,168,rosp,2022-05-03,,,empty,"3/29: 4 branchlings between 168 and 170 (smaller), 4/4: 170, 168, 176 have ROSP chick feathers on ground (dead--flight feathers)" +2022,hidden,170,rosp,2022-02-23,3,,incubating,"3/8: third egg pipping, 3/29: 4 branchlings between 168 and 170 (smaller), 4/4: 170, 168, 176 have ROSP chick feathers on ground (dead--flight feathers)" +2022,hidden,170,rosp,2022-03-01,3,,incubating,"3/8: third egg pipping, 3/29: 4 branchlings between 168 and 170 (smaller), 4/4: 170, 168, 176 have ROSP chick feathers on ground (dead--flight feathers)" +2022,hidden,170,rosp,2022-03-08,1,2,pipping,"3/8: third egg pipping, 3/29: 4 branchlings between 168 and 170 (smaller), 4/4: 170, 168, 176 have ROSP chick feathers on ground (dead--flight feathers)" +2022,hidden,170,rosp,2022-03-15,,2,nestling,"3/8: third egg pipping, 3/29: 4 branchlings between 168 and 170 (smaller), 4/4: 170, 168, 176 have ROSP chick feathers on ground (dead--flight feathers)" +2022,hidden,170,rosp,2022-03-16,,,,"3/8: third egg pipping, 3/29: 4 branchlings between 168 and 170 (smaller), 4/4: 170, 168, 176 have ROSP chick feathers on ground (dead--flight feathers)" +2022,hidden,170,rosp,2022-03-22,,2,nestling,"3/8: third egg pipping, 3/29: 4 branchlings between 168 and 170 (smaller), 4/4: 170, 168, 176 have ROSP chick feathers on ground (dead--flight feathers)" +2022,hidden,170,rosp,2022-03-29,,,empty,"3/8: third egg pipping, 3/29: 4 branchlings between 168 and 170 (smaller), 4/4: 170, 168, 176 have ROSP chick feathers on ground (dead--flight feathers)" +2022,hidden,170,rosp,2022-04-04,,,empty,"3/8: third egg pipping, 3/29: 4 branchlings between 168 and 170 (smaller), 4/4: 170, 168, 176 have ROSP chick feathers on ground (dead--flight feathers)" +2022,hidden,170,rosp,2022-04-12,,,empty,"3/8: third egg pipping, 3/29: 4 branchlings between 168 and 170 (smaller), 4/4: 170, 168, 176 have ROSP chick feathers on ground (dead--flight feathers)" +2022,hidden,170,rosp,2022-04-19,,,empty,"3/8: third egg pipping, 3/29: 4 branchlings between 168 and 170 (smaller), 4/4: 170, 168, 176 have ROSP chick feathers on ground (dead--flight feathers)" +2022,hidden,170,rosp,2022-05-03,,,empty,"3/8: third egg pipping, 3/29: 4 branchlings between 168 and 170 (smaller), 4/4: 170, 168, 176 have ROSP chick feathers on ground (dead--flight feathers)" +2022,hidden,156,rosp,2022-02-23,4,,incubating,"3/1: 1 egg pipping, 3/15: 2 chicks died, failed nest, 3/22: still dead birds in nest" +2022,hidden,156,rosp,2022-03-01,4,,pipping,"3/1: 1 egg pipping, 3/15: 2 chicks died, failed nest, 3/22: still dead birds in nest" +2022,hidden,156,rosp,2022-03-08,,4,nestling,"3/1: 1 egg pipping, 3/15: 2 chicks died, failed nest, 3/22: still dead birds in nest" +2022,hidden,156,rosp,2022-03-15,,,empty,"3/1: 1 egg pipping, 3/15: 2 chicks died, failed nest, 3/22: still dead birds in nest" +2022,hidden,156,rosp,2022-03-16,,,,"3/1: 1 egg pipping, 3/15: 2 chicks died, failed nest, 3/22: still dead birds in nest" +2022,hidden,156,rosp,2022-03-22,,,empty,"3/1: 1 egg pipping, 3/15: 2 chicks died, failed nest, 3/22: still dead birds in nest" +2022,hidden,156,rosp,2022-03-29,,,empty,"3/1: 1 egg pipping, 3/15: 2 chicks died, failed nest, 3/22: still dead birds in nest" +2022,hidden,156,rosp,2022-04-04,,,empty,"3/1: 1 egg pipping, 3/15: 2 chicks died, failed nest, 3/22: still dead birds in nest" +2022,hidden,156,rosp,2022-04-12,,,empty,"3/1: 1 egg pipping, 3/15: 2 chicks died, failed nest, 3/22: still dead birds in nest" +2022,hidden,156,rosp,2022-04-19,,,empty,"3/1: 1 egg pipping, 3/15: 2 chicks died, failed nest, 3/22: still dead birds in nest" +2022,hidden,156,rosp,2022-05-03,,,empty,"3/1: 1 egg pipping, 3/15: 2 chicks died, failed nest, 3/22: still dead birds in nest" +2022,hidden,172,greg,2022-02-23,2,,incubating,"4/12:one chick is a mature branchling, 4/19: big chicks" +2022,hidden,172,greg,2022-03-01,2,,incubating,"4/12:one chick is a mature branchling, 4/19: big chicks" +2022,hidden,172,greg,2022-03-08,2,,incubating,"4/12:one chick is a mature branchling, 4/19: big chicks" +2022,hidden,172,greg,2022-03-15,,2,nestling,"4/12:one chick is a mature branchling, 4/19: big chicks" +2022,hidden,172,greg,2022-03-16,,,,"4/12:one chick is a mature branchling, 4/19: big chicks" +2022,hidden,172,greg,2022-03-22,,2,nestling,"4/12:one chick is a mature branchling, 4/19: big chicks" +2022,hidden,172,greg,2022-03-29,,2,nestling,"4/12:one chick is a mature branchling, 4/19: big chicks" +2022,hidden,172,greg,2022-04-04,,2,nestling,"4/12:one chick is a mature branchling, 4/19: big chicks" +2022,hidden,172,greg,2022-04-12,,2,nestling,"4/12:one chick is a mature branchling, 4/19: big chicks" +2022,hidden,172,greg,2022-04-19,,2,nestling,"4/12:one chick is a mature branchling, 4/19: big chicks" +2022,hidden,172,greg,2022-05-03,,,empty,"4/12:one chick is a mature branchling, 4/19: big chicks" +2022,hidden,158,greg,2022-02-23,3,,incubating,"4/12: big chick, 5/3: chick above, being fed" +2022,hidden,158,greg,2022-03-01,,,missed,"4/12: big chick, 5/3: chick above, being fed" +2022,hidden,158,greg,2022-03-08,,3,nestling,"4/12: big chick, 5/3: chick above, being fed" +2022,hidden,158,greg,2022-03-15,,3,nestling,"4/12: big chick, 5/3: chick above, being fed" +2022,hidden,158,greg,2022-03-16,,,,"4/12: big chick, 5/3: chick above, being fed" +2022,hidden,158,greg,2022-03-22,,1,nestling,"4/12: big chick, 5/3: chick above, being fed" +2022,hidden,158,greg,2022-03-29,,1,nestling,"4/12: big chick, 5/3: chick above, being fed" +2022,hidden,158,greg,2022-04-04,,1,nestling,"4/12: big chick, 5/3: chick above, being fed" +2022,hidden,158,greg,2022-04-12,,1,nestling,"4/12: big chick, 5/3: chick above, being fed" +2022,hidden,158,greg,2022-04-19,,1,nestling,"4/12: big chick, 5/3: chick above, being fed" +2022,hidden,158,greg,2022-05-03,,1,branchling,"4/12: big chick, 5/3: chick above, being fed" +2022,hidden,174,greg,2022-02-23,1,,incubating,"3/22: pulled, collapsed" +2022,hidden,174,greg,2022-03-01,,,empty,"3/22: pulled, collapsed" +2022,hidden,174,greg,2022-03-08,,,empty,"3/22: pulled, collapsed" +2022,hidden,174,greg,2022-03-15,,,empty,"3/22: pulled, collapsed" +2022,hidden,174,greg,2022-03-16,,,,"3/22: pulled, collapsed" +2022,hidden,174,greg,2022-03-22,,,collapsed,"3/22: pulled, collapsed" +2022,hidden,174,greg,2022-03-29,,,pulled,"3/22: pulled, collapsed" +2022,hidden,174,greg,2022-04-04,,,,"3/22: pulled, collapsed" +2022,hidden,174,greg,2022-04-12,,,,"3/22: pulled, collapsed" +2022,hidden,174,greg,2022-04-19,,,,"3/22: pulled, collapsed" +2022,hidden,174,greg,2022-05-03,,,,"3/22: pulled, collapsed" +2022,hidden,176,rosp,2022-02-23,4,,incubating,"3/29: 1 chick dead on ground, 4/4: 170, 168, 176 have ROSP chick feathers on ground (dead--flight feathers)" +2022,hidden,176,rosp,2022-03-01,2,2,hatching,"3/29: 1 chick dead on ground, 4/4: 170, 168, 176 have ROSP chick feathers on ground (dead--flight feathers)" +2022,hidden,176,rosp,2022-03-08,,4,nestling,"3/29: 1 chick dead on ground, 4/4: 170, 168, 176 have ROSP chick feathers on ground (dead--flight feathers)" +2022,hidden,176,rosp,2022-03-15,,3,nestling,"3/29: 1 chick dead on ground, 4/4: 170, 168, 176 have ROSP chick feathers on ground (dead--flight feathers)" +2022,hidden,176,rosp,2022-03-16,,,,"3/29: 1 chick dead on ground, 4/4: 170, 168, 176 have ROSP chick feathers on ground (dead--flight feathers)" +2022,hidden,176,rosp,2022-03-22,,3,nestling,"3/29: 1 chick dead on ground, 4/4: 170, 168, 176 have ROSP chick feathers on ground (dead--flight feathers)" +2022,hidden,176,rosp,2022-03-29,,2,nestling,"3/29: 1 chick dead on ground, 4/4: 170, 168, 176 have ROSP chick feathers on ground (dead--flight feathers)" +2022,hidden,176,rosp,2022-04-04,,,empty,"3/29: 1 chick dead on ground, 4/4: 170, 168, 176 have ROSP chick feathers on ground (dead--flight feathers)" +2022,hidden,176,rosp,2022-04-12,,,empty,"3/29: 1 chick dead on ground, 4/4: 170, 168, 176 have ROSP chick feathers on ground (dead--flight feathers)" +2022,hidden,176,rosp,2022-04-19,,,empty,"3/29: 1 chick dead on ground, 4/4: 170, 168, 176 have ROSP chick feathers on ground (dead--flight feathers)" +2022,hidden,176,rosp,2022-05-03,,,empty,"3/29: 1 chick dead on ground, 4/4: 170, 168, 176 have ROSP chick feathers on ground (dead--flight feathers)" +2022,hidden,182,greg,2022-02-23,3,,incubating,"3/8: gone, pulled" +2022,hidden,182,greg,2022-03-01,,,missed,"3/8: gone, pulled" +2022,hidden,182,greg,2022-03-08,,,empty,"3/8: gone, pulled" +2022,hidden,182,greg,2022-03-15,,,,"3/8: gone, pulled" +2022,hidden,182,greg,2022-03-16,,,,"3/8: gone, pulled" +2022,hidden,182,greg,2022-03-22,,,,"3/8: gone, pulled" +2022,hidden,182,greg,2022-03-29,,,,"3/8: gone, pulled" +2022,hidden,182,greg,2022-04-04,,,,"3/8: gone, pulled" +2022,hidden,182,greg,2022-04-12,,,,"3/8: gone, pulled" +2022,hidden,182,greg,2022-04-19,,,,"3/8: gone, pulled" +2022,hidden,182,greg,2022-05-03,,,,"3/8: gone, pulled" +2022,hidden,178,greg,2022-02-23,2,,incubating,"3/22: younger bird hatched yesterday, 3/29: chicks dry" +2022,hidden,178,greg,2022-03-01,,,missed,"3/22: younger bird hatched yesterday, 3/29: chicks dry" +2022,hidden,178,greg,2022-03-08,4,,incubating,"3/22: younger bird hatched yesterday, 3/29: chicks dry" +2022,hidden,178,greg,2022-03-15,4,,incubating,"3/22: younger bird hatched yesterday, 3/29: chicks dry" +2022,hidden,178,greg,2022-03-16,,,,"3/22: younger bird hatched yesterday, 3/29: chicks dry" +2022,hidden,178,greg,2022-03-22,2,2,hatching,"3/22: younger bird hatched yesterday, 3/29: chicks dry" +2022,hidden,178,greg,2022-03-29,1,2,hatching,"3/22: younger bird hatched yesterday, 3/29: chicks dry" +2022,hidden,178,greg,2022-04-04,1,2,hatching,"3/22: younger bird hatched yesterday, 3/29: chicks dry" +2022,hidden,178,greg,2022-04-12,,2,nestling,"3/22: younger bird hatched yesterday, 3/29: chicks dry" +2022,hidden,178,greg,2022-04-19,,2,nestling,"3/22: younger bird hatched yesterday, 3/29: chicks dry" +2022,hidden,178,greg,2022-05-03,,,empty,"3/22: younger bird hatched yesterday, 3/29: chicks dry" +2022,hidden,190,rosp,2022-02-23,,,, +2022,hidden,190,rosp,2022-03-01,1,,incubating, +2022,hidden,190,rosp,2022-03-08,1,,incubating, +2022,hidden,190,rosp,2022-03-15,1,,incubating, +2022,hidden,190,rosp,2022-03-16,,,, +2022,hidden,190,rosp,2022-03-22,1,,incubating, +2022,hidden,190,rosp,2022-03-29,1,,incubating, +2022,hidden,190,rosp,2022-04-04,1,,incubating, +2022,hidden,190,rosp,2022-04-12,,,missed, +2022,hidden,190,rosp,2022-04-19,,,empty, +2022,hidden,190,rosp,2022-05-03,,,empty, +2022,hidden,192,rosp,2022-02-23,,,,"3/8: all chicks dry, 3/29: 3 branchlings between 166 and 192, 4/4: 2 branchlings high on tree" +2022,hidden,192,rosp,2022-03-01,3,,incubating,"3/8: all chicks dry, 3/29: 3 branchlings between 166 and 192, 4/4: 2 branchlings high on tree" +2022,hidden,192,rosp,2022-03-08,,3,nestling,"3/8: all chicks dry, 3/29: 3 branchlings between 166 and 192, 4/4: 2 branchlings high on tree" +2022,hidden,192,rosp,2022-03-15,,3,nestling,"3/8: all chicks dry, 3/29: 3 branchlings between 166 and 192, 4/4: 2 branchlings high on tree" +2022,hidden,192,rosp,2022-03-16,,,,"3/8: all chicks dry, 3/29: 3 branchlings between 166 and 192, 4/4: 2 branchlings high on tree" +2022,hidden,192,rosp,2022-03-22,,2,nestling,"3/8: all chicks dry, 3/29: 3 branchlings between 166 and 192, 4/4: 2 branchlings high on tree" +2022,hidden,192,rosp,2022-03-29,,,empty,"3/8: all chicks dry, 3/29: 3 branchlings between 166 and 192, 4/4: 2 branchlings high on tree" +2022,hidden,192,rosp,2022-04-04,,,empty,"3/8: all chicks dry, 3/29: 3 branchlings between 166 and 192, 4/4: 2 branchlings high on tree" +2022,hidden,192,rosp,2022-04-12,,,empty,"3/8: all chicks dry, 3/29: 3 branchlings between 166 and 192, 4/4: 2 branchlings high on tree" +2022,hidden,192,rosp,2022-04-19,,,empty,"3/8: all chicks dry, 3/29: 3 branchlings between 166 and 192, 4/4: 2 branchlings high on tree" +2022,hidden,192,rosp,2022-05-03,,,empty,"3/8: all chicks dry, 3/29: 3 branchlings between 166 and 192, 4/4: 2 branchlings high on tree" +2022,hidden,194,greg,2022-02-23,,,, +2022,hidden,194,greg,2022-03-01,2,,incubating, +2022,hidden,194,greg,2022-03-08,1,,incubating, +2022,hidden,194,greg,2022-03-15,1,,incubating, +2022,hidden,194,greg,2022-03-16,,,, +2022,hidden,194,greg,2022-03-22,2,,incubating, +2022,hidden,194,greg,2022-03-29,2,,incubating, +2022,hidden,194,greg,2022-04-04,,,empty, +2022,hidden,194,greg,2022-04-12,,,empty, +2022,hidden,194,greg,2022-04-19,,,empty, +2022,hidden,194,greg,2022-05-03,,,missed, +2022,hidden,220,greg,2022-02-23,,,,"4/19: pulled" +2022,hidden,220,greg,2022-03-01,,,,"4/19: pulled" +2022,hidden,220,greg,2022-03-08,,,,"4/19: pulled" +2022,hidden,220,greg,2022-03-15,2,,incubating,"4/19: pulled" +2022,hidden,220,greg,2022-03-16,,,,"4/19: pulled" +2022,hidden,220,greg,2022-03-22,,,empty,"4/19: pulled" +2022,hidden,220,greg,2022-03-29,,,empty,"4/19: pulled" +2022,hidden,220,greg,2022-04-04,,,empty,"4/19: pulled" +2022,hidden,220,greg,2022-04-12,,,empty,"4/19: pulled" +2022,hidden,220,greg,2022-04-19,,,pulled,"4/19: pulled" +2022,hidden,220,greg,2022-05-03,,,,"4/19: pulled" +2022,hidden,181,greg,2022-02-23,,,,"3/15: dead vulture and escaped egret (now in abandoned nest nearby) (note crossed off at recorded as random GREG chick on ground)" +2022,hidden,181,greg,2022-03-01,,,,"3/15: dead vulture and escaped egret (now in abandoned nest nearby) (note crossed off at recorded as random GREG chick on ground)" +2022,hidden,181,greg,2022-03-08,,,,"3/15: dead vulture and escaped egret (now in abandoned nest nearby) (note crossed off at recorded as random GREG chick on ground)" +2022,hidden,181,greg,2022-03-15,2,,incubating,"3/15: dead vulture and escaped egret (now in abandoned nest nearby) (note crossed off at recorded as random GREG chick on ground)" +2022,hidden,181,greg,2022-03-16,,,,"3/15: dead vulture and escaped egret (now in abandoned nest nearby) (note crossed off at recorded as random GREG chick on ground)" +2022,hidden,181,greg,2022-03-22,3,,incubating,"3/15: dead vulture and escaped egret (now in abandoned nest nearby) (note crossed off at recorded as random GREG chick on ground)" +2022,hidden,181,greg,2022-03-29,3,,incubating,"3/15: dead vulture and escaped egret (now in abandoned nest nearby) (note crossed off at recorded as random GREG chick on ground)" +2022,hidden,181,greg,2022-04-04,,,empty,"3/15: dead vulture and escaped egret (now in abandoned nest nearby) (note crossed off at recorded as random GREG chick on ground)" +2022,hidden,181,greg,2022-04-12,,,empty,"3/15: dead vulture and escaped egret (now in abandoned nest nearby) (note crossed off at recorded as random GREG chick on ground)" +2022,hidden,181,greg,2022-04-19,,,empty,"3/15: dead vulture and escaped egret (now in abandoned nest nearby) (note crossed off at recorded as random GREG chick on ground)" +2022,hidden,181,greg,2022-05-03,,,,"3/15: dead vulture and escaped egret (now in abandoned nest nearby) (note crossed off at recorded as random GREG chick on ground)" +2022,hidden,235,greg,2022-02-23,,,,"New Dome north end (Long dome) start, 3/22: pulled" +2022,hidden,235,greg,2022-03-01,,,,"New Dome north end (Long dome) start, 3/22: pulled" +2022,hidden,235,greg,2022-03-08,2,,incubating,"New Dome north end (Long dome) start, 3/22: pulled" +2022,hidden,235,greg,2022-03-15,,,,"New Dome north end (Long dome) start, 3/22: pulled" +2022,hidden,235,greg,2022-03-16,,,empty,"New Dome north end (Long dome) start, 3/22: pulled" +2022,hidden,235,greg,2022-03-22,,,empty,"New Dome north end (Long dome) start, 3/22: pulled" +2022,hidden,235,greg,2022-03-29,,,,"New Dome north end (Long dome) start, 3/22: pulled" +2022,hidden,235,greg,2022-04-04,,,,"New Dome north end (Long dome) start, 3/22: pulled" +2022,hidden,235,greg,2022-04-12,,,,"New Dome north end (Long dome) start, 3/22: pulled" +2022,hidden,235,greg,2022-04-19,,,,"New Dome north end (Long dome) start, 3/22: pulled" +2022,hidden,235,greg,2022-05-03,,,,"New Dome north end (Long dome) start, 3/22: pulled" +2022,hidden,237,greg,2022-02-23,,,,"3/22: pulled" +2022,hidden,237,greg,2022-03-01,,,,"3/22: pulled" +2022,hidden,237,greg,2022-03-08,2,,incubating,"3/22: pulled" +2022,hidden,237,greg,2022-03-15,,,,"3/22: pulled" +2022,hidden,237,greg,2022-03-16,,,empty,"3/22: pulled" +2022,hidden,237,greg,2022-03-22,,,empty,"3/22: pulled" +2022,hidden,237,greg,2022-03-29,,,,"3/22: pulled" +2022,hidden,237,greg,2022-04-04,,,,"3/22: pulled" +2022,hidden,237,greg,2022-04-12,,,,"3/22: pulled" +2022,hidden,237,greg,2022-04-19,,,,"3/22: pulled" +2022,hidden,237,greg,2022-05-03,,,,"3/22: pulled" +2022,hidden,239,greg,2022-02-23,,,,"3/22: pulled" +2022,hidden,239,greg,2022-03-01,,,,"3/22: pulled" +2022,hidden,239,greg,2022-03-08,2,,incubating,"3/22: pulled" +2022,hidden,239,greg,2022-03-15,,,,"3/22: pulled" +2022,hidden,239,greg,2022-03-16,,,empty,"3/22: pulled" +2022,hidden,239,greg,2022-03-22,,,empty,"3/22: pulled" +2022,hidden,239,greg,2022-03-29,,,,"3/22: pulled" +2022,hidden,239,greg,2022-04-04,,,,"3/22: pulled" +2022,hidden,239,greg,2022-04-12,,,,"3/22: pulled" +2022,hidden,239,greg,2022-04-19,,,,"3/22: pulled" +2022,hidden,239,greg,2022-05-03,,,,"3/22: pulled" +2022,hidden,241,greg,2022-02-23,,,,"3/22: eggshells on ground, pulled" +2022,hidden,241,greg,2022-03-01,,,,"3/22: eggshells on ground, pulled" +2022,hidden,241,greg,2022-03-08,1,,incubating,"3/22: eggshells on ground, pulled" +2022,hidden,241,greg,2022-03-15,,,,"3/22: eggshells on ground, pulled" +2022,hidden,241,greg,2022-03-16,2,,incubating,"3/22: eggshells on ground, pulled" +2022,hidden,241,greg,2022-03-22,,,empty,"3/22: eggshells on ground, pulled" +2022,hidden,241,greg,2022-03-29,,,,"3/22: eggshells on ground, pulled" +2022,hidden,241,greg,2022-04-04,,,,"3/22: eggshells on ground, pulled" +2022,hidden,241,greg,2022-04-12,,,,"3/22: eggshells on ground, pulled" +2022,hidden,241,greg,2022-04-19,,,,"3/22: eggshells on ground, pulled" +2022,hidden,241,greg,2022-05-03,,,,"3/22: eggshells on ground, pulled" +2022,hidden,243,greg,2022-02-23,,,, +2022,hidden,243,greg,2022-03-01,,,, +2022,hidden,243,greg,2022-03-08,3,,incubating, +2022,hidden,243,greg,2022-03-15,,,, +2022,hidden,243,greg,2022-03-16,,,empty, +2022,hidden,243,greg,2022-03-22,,,empty, +2022,hidden,243,greg,2022-03-29,,,empty, +2022,hidden,243,greg,2022-04-04,,,empty, +2022,hidden,243,greg,2022-04-12,,,empty, +2022,hidden,243,greg,2022-04-19,,,empty, +2022,hidden,243,greg,2022-05-03,,,missed, +2022,hidden,245,greg,2022-02-23,,,, +2022,hidden,245,greg,2022-03-01,,,, +2022,hidden,245,greg,2022-03-08,2,,incubating, +2022,hidden,245,greg,2022-03-15,,,, +2022,hidden,245,greg,2022-03-16,3,,incubating, +2022,hidden,245,greg,2022-03-22,3,,incubating, +2022,hidden,245,greg,2022-03-29,,,empty, +2022,hidden,245,greg,2022-04-04,,,empty, +2022,hidden,245,greg,2022-04-12,,,empty, +2022,hidden,245,greg,2022-04-19,,,empty, +2022,hidden,245,greg,2022-05-03,,,missed, +2022,hidden,255,greg,2022-02-23,,,,"3/22: pulled, collapsed" +2022,hidden,255,greg,2022-03-01,,,,"3/22: pulled, collapsed" +2022,hidden,255,greg,2022-03-08,2,,incubating,"3/22: pulled, collapsed" +2022,hidden,255,greg,2022-03-15,,,,"3/22: pulled, collapsed" +2022,hidden,255,greg,2022-03-16,2,,incubating,"3/22: pulled, collapsed" +2022,hidden,255,greg,2022-03-22,,,empty,"3/22: pulled, collapsed" +2022,hidden,255,greg,2022-03-29,,,,"3/22: pulled, collapsed" +2022,hidden,255,greg,2022-04-04,,,,"3/22: pulled, collapsed" +2022,hidden,255,greg,2022-04-12,,,,"3/22: pulled, collapsed" +2022,hidden,255,greg,2022-04-19,,,,"3/22: pulled, collapsed" +2022,hidden,255,greg,2022-05-03,,,,"3/22: pulled, collapsed" +2022,hidden,247,greg,2022-02-23,,,,"3/15: pulled" +2022,hidden,247,greg,2022-03-01,,,,"3/15: pulled" +2022,hidden,247,greg,2022-03-08,2,,incubating,"3/15: pulled" +2022,hidden,247,greg,2022-03-15,,,,"3/15: pulled" +2022,hidden,247,greg,2022-03-16,,,empty,"3/15: pulled" +2022,hidden,247,greg,2022-03-22,,,,"3/15: pulled" +2022,hidden,247,greg,2022-03-29,,,,"3/15: pulled" +2022,hidden,247,greg,2022-04-04,,,,"3/15: pulled" +2022,hidden,247,greg,2022-04-12,,,,"3/15: pulled" +2022,hidden,247,greg,2022-04-19,,,,"3/15: pulled" +2022,hidden,247,greg,2022-05-03,,,,"3/15: pulled" +2022,hidden,257,greg,2022-02-23,,,,"3/22: eggshells on ground, pulled" +2022,hidden,257,greg,2022-03-01,,,,"3/22: eggshells on ground, pulled" +2022,hidden,257,greg,2022-03-08,1,,incubating,"3/22: eggshells on ground, pulled" +2022,hidden,257,greg,2022-03-15,,,,"3/22: eggshells on ground, pulled" +2022,hidden,257,greg,2022-03-16,2,,incubating,"3/22: eggshells on ground, pulled" +2022,hidden,257,greg,2022-03-22,,,empty,"3/22: eggshells on ground, pulled" +2022,hidden,257,greg,2022-03-29,,,,"3/22: eggshells on ground, pulled" +2022,hidden,257,greg,2022-04-04,,,,"3/22: eggshells on ground, pulled" +2022,hidden,257,greg,2022-04-12,,,,"3/22: eggshells on ground, pulled" +2022,hidden,257,greg,2022-04-19,,,,"3/22: eggshells on ground, pulled" +2022,hidden,257,greg,2022-05-03,,,,"3/22: eggshells on ground, pulled" +2022,hidden,259,greg,2022-02-23,,,,"3/22: eggshells on ground, pulled" +2022,hidden,259,greg,2022-03-01,,,,"3/22: eggshells on ground, pulled" +2022,hidden,259,greg,2022-03-08,3,,incubating,"3/22: eggshells on ground, pulled" +2022,hidden,259,greg,2022-03-15,,,,"3/22: eggshells on ground, pulled" +2022,hidden,259,greg,2022-03-16,3,,incubating,"3/22: eggshells on ground, pulled" +2022,hidden,259,greg,2022-03-22,,,empty,"3/22: eggshells on ground, pulled" +2022,hidden,259,greg,2022-03-29,,,,"3/22: eggshells on ground, pulled" +2022,hidden,259,greg,2022-04-04,,,,"3/22: eggshells on ground, pulled" +2022,hidden,259,greg,2022-04-12,,,,"3/22: eggshells on ground, pulled" +2022,hidden,259,greg,2022-04-19,,,,"3/22: eggshells on ground, pulled" +2022,hidden,259,greg,2022-05-03,,,,"3/22: eggshells on ground, pulled" +2022,hidden,249,greg,2022-02-23,,,,"3/22: pulled" +2022,hidden,249,greg,2022-03-01,,,,"3/22: pulled" +2022,hidden,249,greg,2022-03-08,1,,incubating,"3/22: pulled" +2022,hidden,249,greg,2022-03-15,,,,"3/22: pulled" +2022,hidden,249,greg,2022-03-16,,,empty,"3/22: pulled" +2022,hidden,249,greg,2022-03-22,,,empty,"3/22: pulled" +2022,hidden,249,greg,2022-03-29,,,,"3/22: pulled" +2022,hidden,249,greg,2022-04-04,,,,"3/22: pulled" +2022,hidden,249,greg,2022-04-12,,,,"3/22: pulled" +2022,hidden,249,greg,2022-04-19,,,,"3/22: pulled" +2022,hidden,249,greg,2022-05-03,,,,"3/22: pulled" +2022,hidden,261,greg,2022-02-23,,,,"3/8: award for worst nest, 3/22: pulled" +2022,hidden,261,greg,2022-03-01,,,,"3/8: award for worst nest, 3/22: pulled" +2022,hidden,261,greg,2022-03-08,1,,incubating,"3/8: award for worst nest, 3/22: pulled" +2022,hidden,261,greg,2022-03-15,,,,"3/8: award for worst nest, 3/22: pulled" +2022,hidden,261,greg,2022-03-16,,,empty,"3/8: award for worst nest, 3/22: pulled" +2022,hidden,261,greg,2022-03-22,,,empty,"3/8: award for worst nest, 3/22: pulled" +2022,hidden,261,greg,2022-03-29,,,,"3/8: award for worst nest, 3/22: pulled" +2022,hidden,261,greg,2022-04-04,,,,"3/8: award for worst nest, 3/22: pulled" +2022,hidden,261,greg,2022-04-12,,,,"3/8: award for worst nest, 3/22: pulled" +2022,hidden,261,greg,2022-04-19,,,,"3/8: award for worst nest, 3/22: pulled" +2022,hidden,261,greg,2022-05-03,,,,"3/8: award for worst nest, 3/22: pulled" +2022,hidden,251,greg,2022-02-23,,,,"behind 249, 3/16: chicks dry" +2022,hidden,251,greg,2022-03-01,,,,"behind 249, 3/16: chicks dry" +2022,hidden,251,greg,2022-03-08,2,,incubating,"behind 249, 3/16: chicks dry" +2022,hidden,251,greg,2022-03-15,,,,"behind 249, 3/16: chicks dry" +2022,hidden,251,greg,2022-03-16,1,2,hatching,"behind 249, 3/16: chicks dry" +2022,hidden,251,greg,2022-03-22,,3,nestling,"behind 249, 3/16: chicks dry" +2022,hidden,251,greg,2022-03-29,,,empty,"behind 249, 3/16: chicks dry" +2022,hidden,251,greg,2022-04-04,,,empty,"behind 249, 3/16: chicks dry" +2022,hidden,251,greg,2022-04-12,,,empty,"behind 249, 3/16: chicks dry" +2022,hidden,251,greg,2022-04-19,,,empty,"behind 249, 3/16: chicks dry" +2022,hidden,251,greg,2022-05-03,,,missed,"behind 249, 3/16: chicks dry" +2022,hidden,263,greg,2022-02-23,,,,"a few feet behind flagging, 3/22: pulled" +2022,hidden,263,greg,2022-03-01,,,,"a few feet behind flagging, 3/22: pulled" +2022,hidden,263,greg,2022-03-08,2,,incubating,"a few feet behind flagging, 3/22: pulled" +2022,hidden,263,greg,2022-03-15,,,,"a few feet behind flagging, 3/22: pulled" +2022,hidden,263,greg,2022-03-16,,,empty,"a few feet behind flagging, 3/22: pulled" +2022,hidden,263,greg,2022-03-22,,,empty,"a few feet behind flagging, 3/22: pulled" +2022,hidden,263,greg,2022-03-29,,,,"a few feet behind flagging, 3/22: pulled" +2022,hidden,263,greg,2022-04-04,,,,"a few feet behind flagging, 3/22: pulled" +2022,hidden,263,greg,2022-04-12,,,,"a few feet behind flagging, 3/22: pulled" +2022,hidden,263,greg,2022-04-19,,,,"a few feet behind flagging, 3/22: pulled" +2022,hidden,263,greg,2022-05-03,,,,"a few feet behind flagging, 3/22: pulled" +2022,hidden,253,greg,2022-02-23,,,,"3/22: pulled" +2022,hidden,253,greg,2022-03-01,,,,"3/22: pulled" +2022,hidden,253,greg,2022-03-08,1,,incubating,"3/22: pulled" +2022,hidden,253,greg,2022-03-15,,,,"3/22: pulled" +2022,hidden,253,greg,2022-03-16,,,empty,"3/22: pulled" +2022,hidden,253,greg,2022-03-22,,,empty,"3/22: pulled" +2022,hidden,253,greg,2022-03-29,,,,"3/22: pulled" +2022,hidden,253,greg,2022-04-04,,,,"3/22: pulled" +2022,hidden,253,greg,2022-04-12,,,,"3/22: pulled" +2022,hidden,253,greg,2022-04-19,,,,"3/22: pulled" +2022,hidden,253,greg,2022-05-03,,,,"3/22: pulled" +2022,hidden,267,greg,2022-02-23,,,,"3/22: pulled" +2022,hidden,267,greg,2022-03-01,,,,"3/22: pulled" +2022,hidden,267,greg,2022-03-08,2,,incubating,"3/22: pulled" +2022,hidden,267,greg,2022-03-15,,,,"3/22: pulled" +2022,hidden,267,greg,2022-03-16,2,,incubating,"3/22: pulled" +2022,hidden,267,greg,2022-03-22,,,empty,"3/22: pulled" +2022,hidden,267,greg,2022-03-29,,,,"3/22: pulled" +2022,hidden,267,greg,2022-04-04,,,,"3/22: pulled" +2022,hidden,267,greg,2022-04-12,,,,"3/22: pulled" +2022,hidden,267,greg,2022-04-19,,,,"3/22: pulled" +2022,hidden,267,greg,2022-05-03,,,,"3/22: pulled" +2022,hidden,277,greg,2022-02-23,,,,"3/22: pulled" +2022,hidden,277,greg,2022-03-01,,,,"3/22: pulled" +2022,hidden,277,greg,2022-03-08,2,,incubating,"3/22: pulled" +2022,hidden,277,greg,2022-03-15,,,,"3/22: pulled" +2022,hidden,277,greg,2022-03-16,,,empty,"3/22: pulled" +2022,hidden,277,greg,2022-03-22,,,empty,"3/22: pulled" +2022,hidden,277,greg,2022-03-29,,,,"3/22: pulled" +2022,hidden,277,greg,2022-04-04,,,,"3/22: pulled" +2022,hidden,277,greg,2022-04-12,,,,"3/22: pulled" +2022,hidden,277,greg,2022-04-19,,,,"3/22: pulled" +2022,hidden,277,greg,2022-05-03,,,,"3/22: pulled" +2022,hidden,269,greg,2022-02-23,,,,"tall nest, 3/16: chicks dry, 3/29: may be one dead chick under live chick, 4/19: big chick but don’t look healthy, 5/3: healthy!" +2022,hidden,269,greg,2022-03-01,,,,"tall nest, 3/16: chicks dry, 3/29: may be one dead chick under live chick, 4/19: big chick but don’t look healthy, 5/3: healthy!" +2022,hidden,269,greg,2022-03-08,2,,incubating,"tall nest, 3/16: chicks dry, 3/29: may be one dead chick under live chick, 4/19: big chick but don’t look healthy, 5/3: healthy!" +2022,hidden,269,greg,2022-03-15,,,,"tall nest, 3/16: chicks dry, 3/29: may be one dead chick under live chick, 4/19: big chick but don’t look healthy, 5/3: healthy!" +2022,hidden,269,greg,2022-03-16,,2,nestling,"tall nest, 3/16: chicks dry, 3/29: may be one dead chick under live chick, 4/19: big chick but don’t look healthy, 5/3: healthy!" +2022,hidden,269,greg,2022-03-22,,1,nestling,"tall nest, 3/16: chicks dry, 3/29: may be one dead chick under live chick, 4/19: big chick but don’t look healthy, 5/3: healthy!" +2022,hidden,269,greg,2022-03-29,,1,nestling,"tall nest, 3/16: chicks dry, 3/29: may be one dead chick under live chick, 4/19: big chick but don’t look healthy, 5/3: healthy!" +2022,hidden,269,greg,2022-04-04,,1,nestling,"tall nest, 3/16: chicks dry, 3/29: may be one dead chick under live chick, 4/19: big chick but don’t look healthy, 5/3: healthy!" +2022,hidden,269,greg,2022-04-12,,1,nestling,"tall nest, 3/16: chicks dry, 3/29: may be one dead chick under live chick, 4/19: big chick but don’t look healthy, 5/3: healthy!" +2022,hidden,269,greg,2022-04-19,,1,nestling,"tall nest, 3/16: chicks dry, 3/29: may be one dead chick under live chick, 4/19: big chick but don’t look healthy, 5/3: healthy!" +2022,hidden,269,greg,2022-05-03,,1,nestling,"tall nest, 3/16: chicks dry, 3/29: may be one dead chick under live chick, 4/19: big chick but don’t look healthy, 5/3: healthy!" +2022,hidden,279,greg,2022-02-23,,,,"Nest back in cocoplum from pink flagging. 4/19: chicks don’t look healthy, 5/3: healthy!" +2022,hidden,279,greg,2022-03-01,,,,"Nest back in cocoplum from pink flagging. 4/19: chicks don’t look healthy, 5/3: healthy!" +2022,hidden,279,greg,2022-03-08,2,,incubating,"Nest back in cocoplum from pink flagging. 4/19: chicks don’t look healthy, 5/3: healthy!" +2022,hidden,279,greg,2022-03-15,,,,"Nest back in cocoplum from pink flagging. 4/19: chicks don’t look healthy, 5/3: healthy!" +2022,hidden,279,greg,2022-03-16,2,,incubating,"Nest back in cocoplum from pink flagging. 4/19: chicks don’t look healthy, 5/3: healthy!" +2022,hidden,279,greg,2022-03-22,,2,nestling,"Nest back in cocoplum from pink flagging. 4/19: chicks don’t look healthy, 5/3: healthy!" +2022,hidden,279,greg,2022-03-29,,2,nestling,"Nest back in cocoplum from pink flagging. 4/19: chicks don’t look healthy, 5/3: healthy!" +2022,hidden,279,greg,2022-04-04,,2,nestling,"Nest back in cocoplum from pink flagging. 4/19: chicks don’t look healthy, 5/3: healthy!" +2022,hidden,279,greg,2022-04-12,,2,nestling,"Nest back in cocoplum from pink flagging. 4/19: chicks don’t look healthy, 5/3: healthy!" +2022,hidden,279,greg,2022-04-19,,2,nestling,"Nest back in cocoplum from pink flagging. 4/19: chicks don’t look healthy, 5/3: healthy!" +2022,hidden,279,greg,2022-05-03,,2,nestling,"Nest back in cocoplum from pink flagging. 4/19: chicks don’t look healthy, 5/3: healthy!" +2022,hidden,271,greg,2022-02-23,,,,"3/22: eggshells on ground" +2022,hidden,271,greg,2022-03-01,,,,"3/22: eggshells on ground" +2022,hidden,271,greg,2022-03-08,2,,incubating,"3/22: eggshells on ground" +2022,hidden,271,greg,2022-03-15,,,,"3/22: eggshells on ground" +2022,hidden,271,greg,2022-03-16,2,,incubating,"3/22: eggshells on ground" +2022,hidden,271,greg,2022-03-22,,,empty,"3/22: eggshells on ground" +2022,hidden,271,greg,2022-03-29,,,empty,"3/22: eggshells on ground" +2022,hidden,271,greg,2022-04-04,,,empty,"3/22: eggshells on ground" +2022,hidden,271,greg,2022-04-12,,,empty,"3/22: eggshells on ground" +2022,hidden,271,greg,2022-04-19,,,empty,"3/22: eggshells on ground" +2022,hidden,271,greg,2022-05-03,,,empty,"3/22: eggshells on ground" +2022,hidden,281,greg,2022-02-23,,,,"3/22: pulled" +2022,hidden,281,greg,2022-03-01,,,,"3/22: pulled" +2022,hidden,281,greg,2022-03-08,1,,incubating,"3/22: pulled" +2022,hidden,281,greg,2022-03-15,,,,"3/22: pulled" +2022,hidden,281,greg,2022-03-16,2,,incubating,"3/22: pulled" +2022,hidden,281,greg,2022-03-22,,,empty,"3/22: pulled" +2022,hidden,281,greg,2022-03-29,,,,"3/22: pulled" +2022,hidden,281,greg,2022-04-04,,,,"3/22: pulled" +2022,hidden,281,greg,2022-04-12,,,,"3/22: pulled" +2022,hidden,281,greg,2022-04-19,,,,"3/22: pulled" +2022,hidden,281,greg,2022-05-03,,,,"3/22: pulled" +2022,hidden,265,greg,2022-02-23,,,,"3/8: didn't record what was in nest but marked it as a new nest, 3/22: pulled" +2022,hidden,265,greg,2022-03-01,,,,"3/8: didn't record what was in nest but marked it as a new nest, 3/22: pulled" +2022,hidden,265,greg,2022-03-08,,,,"3/8: didn't record what was in nest but marked it as a new nest, 3/22: pulled" +2022,hidden,265,greg,2022-03-15,,,,"3/8: didn't record what was in nest but marked it as a new nest, 3/22: pulled" +2022,hidden,265,greg,2022-03-16,,,empty,"3/8: didn't record what was in nest but marked it as a new nest, 3/22: pulled" +2022,hidden,265,greg,2022-03-22,,,empty,"3/8: didn't record what was in nest but marked it as a new nest, 3/22: pulled" +2022,hidden,265,greg,2022-03-29,,,,"3/8: didn't record what was in nest but marked it as a new nest, 3/22: pulled" +2022,hidden,265,greg,2022-04-04,,,,"3/8: didn't record what was in nest but marked it as a new nest, 3/22: pulled" +2022,hidden,265,greg,2022-04-12,,,,"3/8: didn't record what was in nest but marked it as a new nest, 3/22: pulled" +2022,hidden,265,greg,2022-04-19,,,,"3/8: didn't record what was in nest but marked it as a new nest, 3/22: pulled" +2022,hidden,265,greg,2022-05-03,,,,"3/8: didn't record what was in nest but marked it as a new nest, 3/22: pulled" +2022,hidden,272,greg,2022-02-23,,,, +2022,hidden,272,greg,2022-03-01,,,, +2022,hidden,272,greg,2022-03-08,,,, +2022,hidden,272,greg,2022-03-15,,,, +2022,hidden,272,greg,2022-03-16,,,, +2022,hidden,272,greg,2022-03-22,3,,incubating, +2022,hidden,272,greg,2022-03-29,2,,incubating, +2022,hidden,272,greg,2022-04-04,,,empty, +2022,hidden,272,greg,2022-04-12,,,empty, +2022,hidden,272,greg,2022-04-19,,,empty, +2022,hidden,272,greg,2022-05-03,,,empty, +2022,hidden,274,greg,2022-02-23,,,, +2022,hidden,274,greg,2022-03-01,,,, +2022,hidden,274,greg,2022-03-08,,,, +2022,hidden,274,greg,2022-03-15,,,, +2022,hidden,274,greg,2022-03-16,,,, +2022,hidden,274,greg,2022-03-22,2,,incubating, +2022,hidden,274,greg,2022-03-29,2,,incubating, +2022,hidden,274,greg,2022-04-04,,,empty, +2022,hidden,274,greg,2022-04-12,,,empty, +2022,hidden,274,greg,2022-04-19,,,empty, +2022,hidden,274,greg,2022-05-03,,,empty, +2022,cypress_city,200,greg,2022-03-17,2,,incubating,"4/14: most likely hatched day before, 5/25: orange paper 3" +2022,cypress_city,200,greg,2022-03-23,3,,incubating,"4/14: most likely hatched day before, 5/25: orange paper 3" +2022,cypress_city,200,greg,2022-03-31,3,,incubating,"4/14: most likely hatched day before, 5/25: orange paper 3" +2022,cypress_city,200,greg,2022-04-07,3,,incubating,"4/14: most likely hatched day before, 5/25: orange paper 3" +2022,cypress_city,200,greg,2022-04-14,,3,chick_dry,"4/14: most likely hatched day before, 5/25: orange paper 3" +2022,cypress_city,200,greg,2022-04-21,,3,nestling,"4/14: most likely hatched day before, 5/25: orange paper 3" +2022,cypress_city,200,greg,2022-04-29,,3,nestling,"4/14: most likely hatched day before, 5/25: orange paper 3" +2022,cypress_city,200,greg,2022-05-05,,3,nestling,"4/14: most likely hatched day before, 5/25: orange paper 3" +2022,cypress_city,200,greg,2022-05-25,,,empty,"4/14: most likely hatched day before, 5/25: orange paper 3" +2022,cypress_city,222,rosp,2022-03-17,4,,incubating,"4/21: yellow in nest #4 ( on gps #2), 4/29: paper pulled, 5/25: green paper" +2022,cypress_city,222,rosp,2022-03-23,,,empty,"4/21: yellow in nest #4 ( on gps #2), 4/29: paper pulled, 5/25: green paper" +2022,cypress_city,222,rosp,2022-03-31,,,empty,"4/21: yellow in nest #4 ( on gps #2), 4/29: paper pulled, 5/25: green paper" +2022,cypress_city,222,rosp,2022-04-07,,,empty,"4/21: yellow in nest #4 ( on gps #2), 4/29: paper pulled, 5/25: green paper" +2022,cypress_city,222,rosp,2022-04-14,,,empty,"4/21: yellow in nest #4 ( on gps #2), 4/29: paper pulled, 5/25: green paper" +2022,cypress_city,222,rosp,2022-04-21,,,empty,"4/21: yellow in nest #4 ( on gps #2), 4/29: paper pulled, 5/25: green paper" +2022,cypress_city,222,rosp,2022-04-29,,,empty,"4/21: yellow in nest #4 ( on gps #2), 4/29: paper pulled, 5/25: green paper" +2022,cypress_city,222,rosp,2022-05-05,,,empty,"4/21: yellow in nest #4 ( on gps #2), 4/29: paper pulled, 5/25: green paper" +2022,cypress_city,222,rosp,2022-05-25,,,empty,"4/21: yellow in nest #4 ( on gps #2), 4/29: paper pulled, 5/25: green paper" +2022,cypress_city,202,greg,2022-03-17,2,,incubating,"5/5: one chick sampled 5/7:chick wet" +2022,cypress_city,202,greg,2022-03-23,2,,incubating,"5/5: one chick sampled 5/7:chick wet" +2022,cypress_city,202,greg,2022-03-31,2,,incubating,"5/5: one chick sampled 5/7:chick wet" +2022,cypress_city,202,greg,2022-04-07,1,1,wet_chick,"5/5: one chick sampled 5/7:chick wet" +2022,cypress_city,202,greg,2022-04-14,,2,nestling,"5/5: one chick sampled 5/7:chick wet" +2022,cypress_city,202,greg,2022-04-21,,2,nestling,"5/5: one chick sampled 5/7:chick wet" +2022,cypress_city,202,greg,2022-04-29,,2,nestling,"5/5: one chick sampled 5/7:chick wet" +2022,cypress_city,202,greg,2022-05-05,,2,nestling,"5/5: one chick sampled 5/7:chick wet" +2022,cypress_city,202,greg,2022-05-25,,,empty,"5/5: one chick sampled 5/7:chick wet" +2022,cypress_city,204,greg,2022-03-17,2,,incubating,"4/14: dry chick" +2022,cypress_city,204,greg,2022-03-23,3,,incubating,"4/14: dry chick" +2022,cypress_city,204,greg,2022-03-31,3,,incubating,"4/14: dry chick" +2022,cypress_city,204,greg,2022-04-07,3,,incubating,"4/14: dry chick" +2022,cypress_city,204,greg,2022-04-14,,3,chick_dry,"4/14: dry chick" +2022,cypress_city,204,greg,2022-04-21,,3,nestling,"4/14: dry chick" +2022,cypress_city,204,greg,2022-04-29,,3,nestling,"4/14: dry chick" +2022,cypress_city,204,greg,2022-05-05,,3,nestling,"4/14: dry chick" +2022,cypress_city,204,greg,2022-05-25,,1,nestling,"4/14: dry chick" +2022,cypress_city,224,greg,2022-03-17,3,,incubating,"4/21: blue paper under nest to W #6 (may move in wind), 5/5: one chick dead on ground, 5/25: blue paper" +2022,cypress_city,224,greg,2022-03-23,3,,incubating,"4/21: blue paper under nest to W #6 (may move in wind), 5/5: one chick dead on ground, 5/25: blue paper" +2022,cypress_city,224,greg,2022-03-31,3,,incubating,"4/21: blue paper under nest to W #6 (may move in wind), 5/5: one chick dead on ground, 5/25: blue paper" +2022,cypress_city,224,greg,2022-04-07,3,,incubating,"4/21: blue paper under nest to W #6 (may move in wind), 5/5: one chick dead on ground, 5/25: blue paper" +2022,cypress_city,224,greg,2022-04-14,,3,nestling,"4/21: blue paper under nest to W #6 (may move in wind), 5/5: one chick dead on ground, 5/25: blue paper" +2022,cypress_city,224,greg,2022-04-21,,3,nestling,"4/21: blue paper under nest to W #6 (may move in wind), 5/5: one chick dead on ground, 5/25: blue paper" +2022,cypress_city,224,greg,2022-04-29,,3,nestling,"4/21: blue paper under nest to W #6 (may move in wind), 5/5: one chick dead on ground, 5/25: blue paper" +2022,cypress_city,224,greg,2022-05-05,,1,nestling,"4/21: blue paper under nest to W #6 (may move in wind), 5/5: one chick dead on ground, 5/25: blue paper" +2022,cypress_city,224,greg,2022-05-25,,,empty,"4/21: blue paper under nest to W #6 (may move in wind), 5/5: one chick dead on ground, 5/25: blue paper" +2022,cypress_city,206,greg,2022-03-17,3,,incubating,"5/25: pink paper" +2022,cypress_city,206,greg,2022-03-23,3,,incubating,"5/25: pink paper" +2022,cypress_city,206,greg,2022-03-31,3,,incubating,"5/25: pink paper" +2022,cypress_city,206,greg,2022-04-07,3,,incubating,"5/25: pink paper" +2022,cypress_city,206,greg,2022-04-14,,3,nestling,"5/25: pink paper" +2022,cypress_city,206,greg,2022-04-21,,3,nestling,"5/25: pink paper" +2022,cypress_city,206,greg,2022-04-29,,3,nestling,"5/25: pink paper" +2022,cypress_city,206,greg,2022-05-05,,2,nestling,"5/25: pink paper" +2022,cypress_city,206,greg,2022-05-25,,,empty,"5/25: pink paper" +2022,cypress_city,208,greg,2022-03-17,2,,incubating,"5/25: orange paper" +2022,cypress_city,208,greg,2022-03-23,3,,incubating,"5/25: orange paper" +2022,cypress_city,208,greg,2022-03-31,3,,incubating,"5/25: orange paper" +2022,cypress_city,208,greg,2022-04-07,3,,incubating,"5/25: orange paper" +2022,cypress_city,208,greg,2022-04-14,,2,nestling,"5/25: orange paper" +2022,cypress_city,208,greg,2022-04-21,,2,nestling,"5/25: orange paper" +2022,cypress_city,208,greg,2022-04-29,,2,nestling,"5/25: orange paper" +2022,cypress_city,208,greg,2022-05-05,,2,nestling,"5/25: orange paper" +2022,cypress_city,208,greg,2022-05-25,,,empty,"5/25: orange paper" +2022,cypress_city,210,greg,2022-03-17,1,,incubating,"4/14: dry chick, 4/21: pink 2 ft east of nest #7, 5/25: yellow paper 4' to east, mercury sampled" +2022,cypress_city,210,greg,2022-03-23,2,,incubating,"4/14: dry chick, 4/21: pink 2 ft east of nest #7, 5/25: yellow paper 4' to east, mercury sampled" +2022,cypress_city,210,greg,2022-03-31,2,,incubating,"4/14: dry chick, 4/21: pink 2 ft east of nest #7, 5/25: yellow paper 4' to east, mercury sampled" +2022,cypress_city,210,greg,2022-04-07,2,,incubating,"4/14: dry chick, 4/21: pink 2 ft east of nest #7, 5/25: yellow paper 4' to east, mercury sampled" +2022,cypress_city,210,greg,2022-04-14,,1,chick_dry,"4/14: dry chick, 4/21: pink 2 ft east of nest #7, 5/25: yellow paper 4' to east, mercury sampled" +2022,cypress_city,210,greg,2022-04-21,,1,nestling,"4/14: dry chick, 4/21: pink 2 ft east of nest #7, 5/25: yellow paper 4' to east, mercury sampled" +2022,cypress_city,210,greg,2022-04-29,,1,nestling,"4/14: dry chick, 4/21: pink 2 ft east of nest #7, 5/25: yellow paper 4' to east, mercury sampled" +2022,cypress_city,210,greg,2022-05-05,,2,nestling,"4/14: dry chick, 4/21: pink 2 ft east of nest #7, 5/25: yellow paper 4' to east, mercury sampled" +2022,cypress_city,210,greg,2022-05-25,,2,nestling,"4/14: dry chick, 4/21: pink 2 ft east of nest #7, 5/25: yellow paper 4' to east, mercury sampled" +2022,cypress_city,212,greg,2022-03-17,2,,incubating,"4/14: dry chick, 4/21: pink paper 2 feet east of nest, 5/25: orange paper" +2022,cypress_city,212,greg,2022-03-23,2,,incubating,"4/14: dry chick, 4/21: pink paper 2 feet east of nest, 5/25: orange paper" +2022,cypress_city,212,greg,2022-03-31,2,,incubating,"4/14: dry chick, 4/21: pink paper 2 feet east of nest, 5/25: orange paper" +2022,cypress_city,212,greg,2022-04-07,2,,incubating,"4/14: dry chick, 4/21: pink paper 2 feet east of nest, 5/25: orange paper" +2022,cypress_city,212,greg,2022-04-14,,2,chick_dry,"4/14: dry chick, 4/21: pink paper 2 feet east of nest, 5/25: orange paper" +2022,cypress_city,212,greg,2022-04-21,,2,nestling,"4/14: dry chick, 4/21: pink paper 2 feet east of nest, 5/25: orange paper" +2022,cypress_city,212,greg,2022-04-29,,2,nestling,"4/14: dry chick, 4/21: pink paper 2 feet east of nest, 5/25: orange paper" +2022,cypress_city,212,greg,2022-05-05,,2,nestling,"4/14: dry chick, 4/21: pink paper 2 feet east of nest, 5/25: orange paper" +2022,cypress_city,212,greg,2022-05-25,,,empty,"4/14: dry chick, 4/21: pink paper 2 feet east of nest, 5/25: orange paper" +2022,cypress_city,226,greg,2022-03-17,,,,"Near 208. 4/14: gone, 4/21: green paper in the nest area #7, 5/25: yellow paper" +2022,cypress_city,226,greg,2022-03-23,3,,incubating,"Near 208. 4/14: gone, 4/21: green paper in the nest area #7, 5/25: yellow paper" +2022,cypress_city,226,greg,2022-03-31,3,,incubating,"Near 208. 4/14: gone, 4/21: green paper in the nest area #7, 5/25: yellow paper" +2022,cypress_city,226,greg,2022-04-07,,,empty,"Near 208. 4/14: gone, 4/21: green paper in the nest area #7, 5/25: yellow paper" +2022,cypress_city,226,greg,2022-04-14,,,collapsed,"Near 208. 4/14: gone, 4/21: green paper in the nest area #7, 5/25: yellow paper" +2022,cypress_city,226,greg,2022-04-21,,,collapsed,"Near 208. 4/14: gone, 4/21: green paper in the nest area #7, 5/25: yellow paper" +2022,cypress_city,226,greg,2022-04-29,,,,"Near 208. 4/14: gone, 4/21: green paper in the nest area #7, 5/25: yellow paper" +2022,cypress_city,226,greg,2022-05-05,,,,"Near 208. 4/14: gone, 4/21: green paper in the nest area #7, 5/25: yellow paper" +2022,cypress_city,226,greg,2022-05-25,,,empty,"Near 208. 4/14: gone, 4/21: green paper in the nest area #7, 5/25: yellow paper" +2022,cypress_city,228,greg,2022-03-17,2,,incubating,"4/21: 2C big probaly hatched last week, 5/25: 1+C" +2022,cypress_city,228,greg,2022-03-23,3,,incubating,"4/21: 2C big probaly hatched last week, 5/25: 1+C" +2022,cypress_city,228,greg,2022-03-31,3,,incubating,"4/21: 2C big probaly hatched last week, 5/25: 1+C" +2022,cypress_city,228,greg,2022-04-07,3,,incubating,"4/21: 2C big probaly hatched last week, 5/25: 1+C" +2022,cypress_city,228,greg,2022-04-14,,,missed,"4/21: 2C big probaly hatched last week, 5/25: 1+C" +2022,cypress_city,228,greg,2022-04-21,,3,nestling,"4/21: 2C big probaly hatched last week, 5/25: 1+C" +2022,cypress_city,228,greg,2022-04-29,,3,nestling,"4/21: 2C big probaly hatched last week, 5/25: 1+C" +2022,cypress_city,228,greg,2022-05-05,,3,nestling,"4/21: 2C big probaly hatched last week, 5/25: 1+C" +2022,cypress_city,228,greg,2022-05-25,,1,nestling,"4/21: 2C big probaly hatched last week, 5/25: 1+C" +2022,cypress_city,214,greg,2022-03-17,3,,incubating,"4/7: chick dry, one egg pipping, 5/5: chicks climbing up tree" +2022,cypress_city,214,greg,2022-03-23,3,,incubating,"4/7: chick dry, one egg pipping, 5/5: chicks climbing up tree" +2022,cypress_city,214,greg,2022-03-31,3,,incubating,"4/7: chick dry, one egg pipping, 5/5: chicks climbing up tree" +2022,cypress_city,214,greg,2022-04-07,2,1,pipping,"4/7: chick dry, one egg pipping, 5/5: chicks climbing up tree" +2022,cypress_city,214,greg,2022-04-14,,3,nestling,"4/7: chick dry, one egg pipping, 5/5: chicks climbing up tree" +2022,cypress_city,214,greg,2022-04-21,,3,nestling,"4/7: chick dry, one egg pipping, 5/5: chicks climbing up tree" +2022,cypress_city,214,greg,2022-04-29,,3,nestling,"4/7: chick dry, one egg pipping, 5/5: chicks climbing up tree" +2022,cypress_city,214,greg,2022-05-05,,2,nestling,"4/7: chick dry, one egg pipping, 5/5: chicks climbing up tree" +2022,cypress_city,214,greg,2022-05-25,,,missed,"4/7: chick dry, one egg pipping, 5/5: chicks climbing up tree" +2022,cypress_city,216,rosp,2022-03-17,4,,incubating,"4/7: egg pipping" +2022,cypress_city,216,rosp,2022-03-23,4,,incubating,"4/7: egg pipping" +2022,cypress_city,216,rosp,2022-03-31,3,,incubating,"4/7: egg pipping" +2022,cypress_city,216,rosp,2022-04-07,1,2,pipping,"4/7: egg pipping" +2022,cypress_city,216,rosp,2022-04-14,,3,nestling,"4/7: egg pipping" +2022,cypress_city,216,rosp,2022-04-21,,3,nestling,"4/7: egg pipping" +2022,cypress_city,216,rosp,2022-04-29,,2,nestling,"4/7: egg pipping" +2022,cypress_city,216,rosp,2022-05-05,,2,nestling,"4/7: egg pipping" +2022,cypress_city,216,rosp,2022-05-25,,,empty,"4/7: egg pipping" +2022,cypress_city,218,greg,2022-03-17,2,,incubating,"3/17: eggs seemed small-possibly small heron?, 3/23: may be GREG, 4/14: gone, 4/21: orange paper in the understory #9, 4/29: paper pulled" +2022,cypress_city,218,greg,2022-03-23,2,,incubating,"3/17: eggs seemed small-possibly small heron?, 3/23: may be GREG, 4/14: gone, 4/21: orange paper in the understory #9, 4/29: paper pulled" +2022,cypress_city,218,greg,2022-03-31,2,,incubating,"3/17: eggs seemed small-possibly small heron?, 3/23: may be GREG, 4/14: gone, 4/21: orange paper in the understory #9, 4/29: paper pulled" +2022,cypress_city,218,greg,2022-04-07,,,empty,"3/17: eggs seemed small-possibly small heron?, 3/23: may be GREG, 4/14: gone, 4/21: orange paper in the understory #9, 4/29: paper pulled" +2022,cypress_city,218,greg,2022-04-14,,,collapsed,"3/17: eggs seemed small-possibly small heron?, 3/23: may be GREG, 4/14: gone, 4/21: orange paper in the understory #9, 4/29: paper pulled" +2022,cypress_city,218,greg,2022-04-21,,,,"3/17: eggs seemed small-possibly small heron?, 3/23: may be GREG, 4/14: gone, 4/21: orange paper in the understory #9, 4/29: paper pulled" +2022,cypress_city,218,greg,2022-04-29,,,,"3/17: eggs seemed small-possibly small heron?, 3/23: may be GREG, 4/14: gone, 4/21: orange paper in the understory #9, 4/29: paper pulled" +2022,cypress_city,218,greg,2022-05-05,,,,"3/17: eggs seemed small-possibly small heron?, 3/23: may be GREG, 4/14: gone, 4/21: orange paper in the understory #9, 4/29: paper pulled" +2022,cypress_city,218,greg,2022-05-25,,,missed,"3/17: eggs seemed small-possibly small heron?, 3/23: may be GREG, 4/14: gone, 4/21: orange paper in the understory #9, 4/29: paper pulled" +2022,cypress_city,230,rosp,2022-03-17,3,,incubating,"3/23: eggshell on ground" +2022,cypress_city,230,rosp,2022-03-23,2,,incubating,"3/23: eggshell on ground" +2022,cypress_city,230,rosp,2022-03-31,2,,incubating,"3/23: eggshell on ground" +2022,cypress_city,230,rosp,2022-04-07,1,1,incubating,"3/23: eggshell on ground" +2022,cypress_city,230,rosp,2022-04-14,1,1,hatching,"3/23: eggshell on ground" +2022,cypress_city,230,rosp,2022-04-21,,1,nestling,"3/23: eggshell on ground" +2022,cypress_city,230,rosp,2022-04-29,,1,nestling,"3/23: eggshell on ground" +2022,cypress_city,230,rosp,2022-05-05,,1,nestling,"3/23: eggshell on ground" +2022,cypress_city,230,rosp,2022-05-25,,,empty,"3/23: eggshell on ground" +2022,cypress_city,232,greg,2022-03-17,3,,incubating,"4/14: one dead chick" +2022,cypress_city,232,greg,2022-03-23,3,,incubating,"4/14: one dead chick" +2022,cypress_city,232,greg,2022-03-31,3,,incubating,"4/14: one dead chick" +2022,cypress_city,232,greg,2022-04-07,2,1,pipping,"4/14: one dead chick" +2022,cypress_city,232,greg,2022-04-14,,2,nestling,"4/14: one dead chick" +2022,cypress_city,232,greg,2022-04-21,,2,nestling,"4/14: one dead chick" +2022,cypress_city,232,greg,2022-04-29,,2,nestling,"4/14: one dead chick" +2022,cypress_city,232,greg,2022-05-05,,2,nestling,"4/14: one dead chick" +2022,cypress_city,232,greg,2022-05-25,,,empty,"4/14: one dead chick" +2022,cypress_city,234,gbhe,2022-03-17,1,,incubating,"3/17: one tiny whitish egg too (not included in the count), 3/23: eggshell on the ground, 3/31: pulled, collapsed, 5/25: gone" +2022,cypress_city,234,gbhe,2022-03-23,,,empty,"3/17: one tiny whitish egg too (not included in the count), 3/23: eggshell on the ground, 3/31: pulled, collapsed, 5/25: gone" +2022,cypress_city,234,gbhe,2022-03-31,,,collapsed,"3/17: one tiny whitish egg too (not included in the count), 3/23: eggshell on the ground, 3/31: pulled, collapsed, 5/25: gone" +2022,cypress_city,234,gbhe,2022-04-07,,,,"3/17: one tiny whitish egg too (not included in the count), 3/23: eggshell on the ground, 3/31: pulled, collapsed, 5/25: gone" +2022,cypress_city,234,gbhe,2022-04-14,,,collapsed,"3/17: one tiny whitish egg too (not included in the count), 3/23: eggshell on the ground, 3/31: pulled, collapsed, 5/25: gone" +2022,cypress_city,234,gbhe,2022-04-21,,,,"3/17: one tiny whitish egg too (not included in the count), 3/23: eggshell on the ground, 3/31: pulled, collapsed, 5/25: gone" +2022,cypress_city,234,gbhe,2022-04-29,,,,"3/17: one tiny whitish egg too (not included in the count), 3/23: eggshell on the ground, 3/31: pulled, collapsed, 5/25: gone" +2022,cypress_city,234,gbhe,2022-05-05,,,,"3/17: one tiny whitish egg too (not included in the count), 3/23: eggshell on the ground, 3/31: pulled, collapsed, 5/25: gone" +2022,cypress_city,234,gbhe,2022-05-25,,,collapsed,"3/17: one tiny whitish egg too (not included in the count), 3/23: eggshell on the ground, 3/31: pulled, collapsed, 5/25: gone" +2022,cypress_city,236,greg,2022-03-17,2,,incubating,"4/21: yellow paper 2 feet to north of nest #10, 5/25: orange paper" +2022,cypress_city,236,greg,2022-03-23,2,,incubating,"4/21: yellow paper 2 feet to north of nest #10, 5/25: orange paper" +2022,cypress_city,236,greg,2022-03-31,2,,incubating,"4/21: yellow paper 2 feet to north of nest #10, 5/25: orange paper" +2022,cypress_city,236,greg,2022-04-07,2,,incubating,"4/21: yellow paper 2 feet to north of nest #10, 5/25: orange paper" +2022,cypress_city,236,greg,2022-04-14,,2,nestling,"4/21: yellow paper 2 feet to north of nest #10, 5/25: orange paper" +2022,cypress_city,236,greg,2022-04-21,,2,nestling,"4/21: yellow paper 2 feet to north of nest #10, 5/25: orange paper" +2022,cypress_city,236,greg,2022-04-29,,2,nestling,"4/21: yellow paper 2 feet to north of nest #10, 5/25: orange paper" +2022,cypress_city,236,greg,2022-05-05,,2,nestling,"4/21: yellow paper 2 feet to north of nest #10, 5/25: orange paper" +2022,cypress_city,236,greg,2022-05-25,,,empty,"4/21: yellow paper 2 feet to north of nest #10, 5/25: orange paper" +2022,cypress_city,238,greg,2022-03-17,3,,incubating,"4/7: 1 egg also pipping, 5/25: blue paper" +2022,cypress_city,238,greg,2022-03-23,3,,incubating,"4/7: 1 egg also pipping, 5/25: blue paper" +2022,cypress_city,238,greg,2022-03-31,3,,incubating,"4/7: 1 egg also pipping, 5/25: blue paper" +2022,cypress_city,238,greg,2022-04-07,2,1,wet_chick,"4/7: 1 egg also pipping, 5/25: blue paper" +2022,cypress_city,238,greg,2022-04-14,,3,nestling,"4/7: 1 egg also pipping, 5/25: blue paper" +2022,cypress_city,238,greg,2022-04-21,,3,nestling,"4/7: 1 egg also pipping, 5/25: blue paper" +2022,cypress_city,238,greg,2022-04-29,,3,nestling,"4/7: 1 egg also pipping, 5/25: blue paper" +2022,cypress_city,238,greg,2022-05-05,,3,nestling,"4/7: 1 egg also pipping, 5/25: blue paper" +2022,cypress_city,238,greg,2022-05-25,,,empty,"4/7: 1 egg also pipping, 5/25: blue paper" +2022,cypress_city,240,greg,2022-03-17,2,,incubating,"4/14: gone, 4/21: blue paper in nest #11, 5/25: orange paper" +2022,cypress_city,240,greg,2022-03-23,2,,incubating,"4/14: gone, 4/21: blue paper in nest #11, 5/25: orange paper" +2022,cypress_city,240,greg,2022-03-31,2,,incubating,"4/14: gone, 4/21: blue paper in nest #11, 5/25: orange paper" +2022,cypress_city,240,greg,2022-04-07,,,empty,"4/14: gone, 4/21: blue paper in nest #11, 5/25: orange paper" +2022,cypress_city,240,greg,2022-04-14,,,collapsed,"4/14: gone, 4/21: blue paper in nest #11, 5/25: orange paper" +2022,cypress_city,240,greg,2022-04-21,,,,"4/14: gone, 4/21: blue paper in nest #11, 5/25: orange paper" +2022,cypress_city,240,greg,2022-04-29,,,,"4/14: gone, 4/21: blue paper in nest #11, 5/25: orange paper" +2022,cypress_city,240,greg,2022-05-05,,,,"4/14: gone, 4/21: blue paper in nest #11, 5/25: orange paper" +2022,cypress_city,240,greg,2022-05-25,,,empty,"4/14: gone, 4/21: blue paper in nest #11, 5/25: orange paper" +2022,cypress_city,242,greg,2022-03-17,3,,incubating,"4/7: chick dry, Nest is to the east of 240 and south of 244. 4/21: E likely dead, 5/5: at least one chick, large- ran away, 5/25: blue paper" +2022,cypress_city,242,greg,2022-03-23,3,,incubating,"4/7: chick dry, Nest is to the east of 240 and south of 244. 4/21: E likely dead, 5/5: at least one chick, large- ran away, 5/25: blue paper" +2022,cypress_city,242,greg,2022-03-31,3,,incubating,"4/7: chick dry, Nest is to the east of 240 and south of 244. 4/21: E likely dead, 5/5: at least one chick, large- ran away, 5/25: blue paper" +2022,cypress_city,242,greg,2022-04-07,2,1,incubating,"4/7: chick dry, Nest is to the east of 240 and south of 244. 4/21: E likely dead, 5/5: at least one chick, large- ran away, 5/25: blue paper" +2022,cypress_city,242,greg,2022-04-14,1,2,hatching,"4/7: chick dry, Nest is to the east of 240 and south of 244. 4/21: E likely dead, 5/5: at least one chick, large- ran away, 5/25: blue paper" +2022,cypress_city,242,greg,2022-04-21,1,2,hatching,"4/7: chick dry, Nest is to the east of 240 and south of 244. 4/21: E likely dead, 5/5: at least one chick, large- ran away, 5/25: blue paper" +2022,cypress_city,242,greg,2022-04-29,,2,nestling,"4/7: chick dry, Nest is to the east of 240 and south of 244. 4/21: E likely dead, 5/5: at least one chick, large- ran away, 5/25: blue paper" +2022,cypress_city,242,greg,2022-05-05,,1,nestling,"4/7: chick dry, Nest is to the east of 240 and south of 244. 4/21: E likely dead, 5/5: at least one chick, large- ran away, 5/25: blue paper" +2022,cypress_city,242,greg,2022-05-25,,,empty,"4/7: chick dry, Nest is to the east of 240 and south of 244. 4/21: E likely dead, 5/5: at least one chick, large- ran away, 5/25: blue paper" +2022,cypress_city,244,greg,2022-03-17,3,,incubating,"5/5: at leat one chick, large-ran away, sampled, 5/25: pink paper" +2022,cypress_city,244,greg,2022-03-23,3,,incubating,"5/5: at leat one chick, large-ran away, sampled, 5/25: pink paper" +2022,cypress_city,244,greg,2022-03-31,,,missed,"5/5: at leat one chick, large-ran away, sampled, 5/25: pink paper" +2022,cypress_city,244,greg,2022-04-07,3,,incubating,"5/5: at leat one chick, large-ran away, sampled, 5/25: pink paper" +2022,cypress_city,244,greg,2022-04-14,,3,nestling,"5/5: at leat one chick, large-ran away, sampled, 5/25: pink paper" +2022,cypress_city,244,greg,2022-04-21,,3,nestling,"5/5: at leat one chick, large-ran away, sampled, 5/25: pink paper" +2022,cypress_city,244,greg,2022-04-29,,3,nestling,"5/5: at leat one chick, large-ran away, sampled, 5/25: pink paper" +2022,cypress_city,244,greg,2022-05-05,,1,nestling,"5/5: at leat one chick, large-ran away, sampled, 5/25: pink paper" +2022,cypress_city,244,greg,2022-05-25,,,empty,"5/5: at leat one chick, large-ran away, sampled, 5/25: pink paper" +2022,cypress_city,246,greg,2022-03-17,3,,incubating,"4/14: dry chick, 5/25: green paper" +2022,cypress_city,246,greg,2022-03-23,3,,incubating,"4/14: dry chick, 5/25: green paper" +2022,cypress_city,246,greg,2022-03-31,3,,incubating,"4/14: dry chick, 5/25: green paper" +2022,cypress_city,246,greg,2022-04-07,3,,pipping,"4/14: dry chick, 5/25: green paper" +2022,cypress_city,246,greg,2022-04-14,1,2,chick_dry,"4/14: dry chick, 5/25: green paper" +2022,cypress_city,246,greg,2022-04-21,1,2,hatching,"4/14: dry chick, 5/25: green paper" +2022,cypress_city,246,greg,2022-04-29,,2,nestling,"4/14: dry chick, 5/25: green paper" +2022,cypress_city,246,greg,2022-05-05,,2,nestling,"4/14: dry chick, 5/25: green paper" +2022,cypress_city,246,greg,2022-05-25,,,empty,"4/14: dry chick, 5/25: green paper" +2022,cypress_city,248,anhi,2022-03-17,2,,incubating,"4/7: ANHI eggs in nest" +2022,cypress_city,248,anhi,2022-03-23,3,,incubating,"4/7: ANHI eggs in nest" +2022,cypress_city,248,anhi,2022-03-31,,1,nestling,"4/7: ANHI eggs in nest" +2022,cypress_city,248,anhi,2022-04-07,,,pulled,"4/7: ANHI eggs in nest" +2022,cypress_city,248,anhi,2022-04-14,,,,"4/7: ANHI eggs in nest" +2022,cypress_city,248,anhi,2022-04-21,,,,"4/7: ANHI eggs in nest" +2022,cypress_city,248,anhi,2022-04-29,,,,"4/7: ANHI eggs in nest" +2022,cypress_city,248,anhi,2022-05-05,,,,"4/7: ANHI eggs in nest" +2022,cypress_city,248,anhi,2022-05-25,,,,"4/7: ANHI eggs in nest" +2022,cypress_city,250,greg,2022-03-17,3,,incubating,"4/21: orange paper 4 feet west of nest #13 (may blow away)" +2022,cypress_city,250,greg,2022-03-23,3,,incubating,"4/21: orange paper 4 feet west of nest #13 (may blow away)" +2022,cypress_city,250,greg,2022-03-31,3,,incubating,"4/21: orange paper 4 feet west of nest #13 (may blow away)" +2022,cypress_city,250,greg,2022-04-07,1,2,incubating,"4/21: orange paper 4 feet west of nest #13 (may blow away)" +2022,cypress_city,250,greg,2022-04-14,1,2,hatching,"4/21: orange paper 4 feet west of nest #13 (may blow away)" +2022,cypress_city,250,greg,2022-04-21,,2,nestling,"4/21: orange paper 4 feet west of nest #13 (may blow away)" +2022,cypress_city,250,greg,2022-04-29,,2,nestling,"4/21: orange paper 4 feet west of nest #13 (may blow away)" +2022,cypress_city,250,greg,2022-05-05,,2,nestling,"4/21: orange paper 4 feet west of nest #13 (may blow away)" +2022,cypress_city,250,greg,2022-05-25,,,empty,"4/21: orange paper 4 feet west of nest #13 (may blow away)" +2022,cypress_city,252,rosp,2022-03-17,1,,incubating,"5/25: orange paper" +2022,cypress_city,252,rosp,2022-03-23,3,,incubating,"5/25: orange paper" +2022,cypress_city,252,rosp,2022-03-31,3,,incubating,"5/25: orange paper" +2022,cypress_city,252,rosp,2022-04-07,3,,incubating,"5/25: orange paper" +2022,cypress_city,252,rosp,2022-04-14,,3,nestling,"5/25: orange paper" +2022,cypress_city,252,rosp,2022-04-21,,3,nestling,"5/25: orange paper" +2022,cypress_city,252,rosp,2022-04-29,,3,nestling,"5/25: orange paper" +2022,cypress_city,252,rosp,2022-05-05,,1,nestling,"5/25: orange paper" +2022,cypress_city,252,rosp,2022-05-25,,,empty,"5/25: orange paper" +2022,cypress_city,254,greg,2022-03-17,2,,incubating,"4/7: chick dry, Off transect to the right after 363. 4/21: 443 and 254 share one orange paper on the ground between them #13" +2022,cypress_city,254,greg,2022-03-23,2,,incubating,"4/7: chick dry, Off transect to the right after 363. 4/21: 443 and 254 share one orange paper on the ground between them #13" +2022,cypress_city,254,greg,2022-03-31,2,,incubating,"4/7: chick dry, Off transect to the right after 363. 4/21: 443 and 254 share one orange paper on the ground between them #13" +2022,cypress_city,254,greg,2022-04-07,1,1,hatching,"4/7: chick dry, Off transect to the right after 363. 4/21: 443 and 254 share one orange paper on the ground between them #13" +2022,cypress_city,254,greg,2022-04-14,,2,nestling,"4/7: chick dry, Off transect to the right after 363. 4/21: 443 and 254 share one orange paper on the ground between them #13" +2022,cypress_city,254,greg,2022-04-21,,2,nestling,"4/7: chick dry, Off transect to the right after 363. 4/21: 443 and 254 share one orange paper on the ground between them #13" +2022,cypress_city,254,greg,2022-04-29,,2,nestling,"4/7: chick dry, Off transect to the right after 363. 4/21: 443 and 254 share one orange paper on the ground between them #13" +2022,cypress_city,254,greg,2022-05-05,,,missed,"4/7: chick dry, Off transect to the right after 363. 4/21: 443 and 254 share one orange paper on the ground between them #13" +2022,cypress_city,254,greg,2022-05-25,,,missed,"4/7: chick dry, Off transect to the right after 363. 4/21: 443 and 254 share one orange paper on the ground between them #13" +2022,cypress_city,256,greg,2022-03-17,3,,incubating, +2022,cypress_city,256,greg,2022-03-23,2,,incubating, +2022,cypress_city,256,greg,2022-03-31,,2,nestling, +2022,cypress_city,256,greg,2022-04-07,,2,nestling, +2022,cypress_city,256,greg,2022-04-14,,2,nestling, +2022,cypress_city,256,greg,2022-04-21,,2,nestling, +2022,cypress_city,256,greg,2022-04-29,,2,nestling, +2022,cypress_city,256,greg,2022-05-05,,2,nestling, +2022,cypress_city,256,greg,2022-05-25,,,empty, +2022,cypress_city,258,greg,2022-03-17,2,,incubating, +2022,cypress_city,258,greg,2022-03-23,2,,incubating, +2022,cypress_city,258,greg,2022-03-31,2,,incubating, +2022,cypress_city,258,greg,2022-04-07,,2,nestling, +2022,cypress_city,258,greg,2022-04-14,,2,nestling, +2022,cypress_city,258,greg,2022-04-21,,2,nestling, +2022,cypress_city,258,greg,2022-04-29,,2,nestling, +2022,cypress_city,258,greg,2022-05-05,,1,nestling, +2022,cypress_city,258,greg,2022-05-25,,1,nestling, +2022,cypress_city,260,greg,2022-03-17,2,,incubating,"5/25: pink paper right beside 367 and 258" +2022,cypress_city,260,greg,2022-03-23,3,,incubating,"5/25: pink paper right beside 367 and 258" +2022,cypress_city,260,greg,2022-03-31,3,,incubating,"5/25: pink paper right beside 367 and 258" +2022,cypress_city,260,greg,2022-04-07,3,,incubating,"5/25: pink paper right beside 367 and 258" +2022,cypress_city,260,greg,2022-04-14,,3,nestling,"5/25: pink paper right beside 367 and 258" +2022,cypress_city,260,greg,2022-04-21,,3,nestling,"5/25: pink paper right beside 367 and 258" +2022,cypress_city,260,greg,2022-04-29,,3,nestling,"5/25: pink paper right beside 367 and 258" +2022,cypress_city,260,greg,2022-05-05,,3,nestling,"5/25: pink paper right beside 367 and 258" +2022,cypress_city,260,greg,2022-05-25,,,empty,"5/25: pink paper right beside 367 and 258" +2022,cypress_city,262,greg,2022-03-17,2,,incubating,"4/21: blue paper in nest #16, 5/25: yellow beside" +2022,cypress_city,262,greg,2022-03-23,2,,incubating,"4/21: blue paper in nest #16, 5/25: yellow beside" +2022,cypress_city,262,greg,2022-03-31,,,empty,"4/21: blue paper in nest #16, 5/25: yellow beside" +2022,cypress_city,262,greg,2022-04-07,,,empty,"4/21: blue paper in nest #16, 5/25: yellow beside" +2022,cypress_city,262,greg,2022-04-14,,,empty,"4/21: blue paper in nest #16, 5/25: yellow beside" +2022,cypress_city,262,greg,2022-04-21,,,empty,"4/21: blue paper in nest #16, 5/25: yellow beside" +2022,cypress_city,262,greg,2022-04-29,,,empty,"4/21: blue paper in nest #16, 5/25: yellow beside" +2022,cypress_city,262,greg,2022-05-05,,,empty,"4/21: blue paper in nest #16, 5/25: yellow beside" +2022,cypress_city,262,greg,2022-05-25,,,empty,"4/21: blue paper in nest #16, 5/25: yellow beside" +2022,cypress_city,264,greg,2022-03-17,3,,incubating,"5/5: 3Chicks-certain Off transect to the left of 266. 5/25: to west of 268 and 301" +2022,cypress_city,264,greg,2022-03-23,3,,incubating,"5/5: 3Chicks-certain Off transect to the left of 266. 5/25: to west of 268 and 301" +2022,cypress_city,264,greg,2022-03-31,3,,incubating,"5/5: 3Chicks-certain Off transect to the left of 266. 5/25: to west of 268 and 301" +2022,cypress_city,264,greg,2022-04-07,3,,incubating,"5/5: 3Chicks-certain Off transect to the left of 266. 5/25: to west of 268 and 301" +2022,cypress_city,264,greg,2022-04-14,,2,nestling,"5/5: 3Chicks-certain Off transect to the left of 266. 5/25: to west of 268 and 301" +2022,cypress_city,264,greg,2022-04-21,,2,nestling,"5/5: 3Chicks-certain Off transect to the left of 266. 5/25: to west of 268 and 301" +2022,cypress_city,264,greg,2022-04-29,,2,nestling,"5/5: 3Chicks-certain Off transect to the left of 266. 5/25: to west of 268 and 301" +2022,cypress_city,264,greg,2022-05-05,,3,nestling,"5/5: 3Chicks-certain Off transect to the left of 266. 5/25: to west of 268 and 301" +2022,cypress_city,264,greg,2022-05-25,,,empty,"5/5: 3Chicks-certain Off transect to the left of 266. 5/25: to west of 268 and 301" +2022,cypress_city,266,greg,2022-03-17,1,,incubating,"4/21: yellow paper 3 feet north of nest #17, 5/25: beside 268 in vines" +2022,cypress_city,266,greg,2022-03-23,3,,incubating,"4/21: yellow paper 3 feet north of nest #17, 5/25: beside 268 in vines" +2022,cypress_city,266,greg,2022-03-31,3,,incubating,"4/21: yellow paper 3 feet north of nest #17, 5/25: beside 268 in vines" +2022,cypress_city,266,greg,2022-04-07,3,,incubating,"4/21: yellow paper 3 feet north of nest #17, 5/25: beside 268 in vines" +2022,cypress_city,266,greg,2022-04-14,1,2,nestling,"4/21: yellow paper 3 feet north of nest #17, 5/25: beside 268 in vines" +2022,cypress_city,266,greg,2022-04-21,,3,nestling,"4/21: yellow paper 3 feet north of nest #17, 5/25: beside 268 in vines" +2022,cypress_city,266,greg,2022-04-29,,3,nestling,"4/21: yellow paper 3 feet north of nest #17, 5/25: beside 268 in vines" +2022,cypress_city,266,greg,2022-05-05,,2,nestling,"4/21: yellow paper 3 feet north of nest #17, 5/25: beside 268 in vines" +2022,cypress_city,266,greg,2022-05-25,,,empty,"4/21: yellow paper 3 feet north of nest #17, 5/25: beside 268 in vines" +2022,cypress_city,268,greg,2022-03-17,2,,incubating,"Nest is North of 226. 3/23: eggs are small?, 5/25: pink beside" +2022,cypress_city,268,greg,2022-03-23,2,,incubating,"Nest is North of 226. 3/23: eggs are small?, 5/25: pink beside" +2022,cypress_city,268,greg,2022-03-31,2,,incubating,"Nest is North of 226. 3/23: eggs are small?, 5/25: pink beside" +2022,cypress_city,268,greg,2022-04-07,,2,nestling,"Nest is North of 226. 3/23: eggs are small?, 5/25: pink beside" +2022,cypress_city,268,greg,2022-04-14,,2,nestling,"Nest is North of 226. 3/23: eggs are small?, 5/25: pink beside" +2022,cypress_city,268,greg,2022-04-21,,2,nestling,"Nest is North of 226. 3/23: eggs are small?, 5/25: pink beside" +2022,cypress_city,268,greg,2022-04-29,,2,nestling,"Nest is North of 226. 3/23: eggs are small?, 5/25: pink beside" +2022,cypress_city,268,greg,2022-05-05,,1,nestling,"Nest is North of 226. 3/23: eggs are small?, 5/25: pink beside" +2022,cypress_city,268,greg,2022-05-25,,,empty,"Nest is North of 226. 3/23: eggs are small?, 5/25: pink beside" +2022,cypress_city,270,greg,2022-03-17,3,,incubating,"4/7: chicks dry 4/21: Nest is in the cypress trees. 3/23: eggs small?" +2022,cypress_city,270,greg,2022-03-23,3,,incubating,"4/7: chicks dry 4/21: Nest is in the cypress trees. 3/23: eggs small?" +2022,cypress_city,270,greg,2022-03-31,3,,incubating,"4/7: chicks dry 4/21: Nest is in the cypress trees. 3/23: eggs small?" +2022,cypress_city,270,greg,2022-04-07,,3,nestling,"4/7: chicks dry 4/21: Nest is in the cypress trees. 3/23: eggs small?" +2022,cypress_city,270,greg,2022-04-14,,3,nestling,"4/7: chicks dry 4/21: Nest is in the cypress trees. 3/23: eggs small?" +2022,cypress_city,270,greg,2022-04-21,,3,branchling,"4/7: chicks dry 4/21: Nest is in the cypress trees. 3/23: eggs small?" +2022,cypress_city,270,greg,2022-04-29,,3,nestling,"4/7: chicks dry 4/21: Nest is in the cypress trees. 3/23: eggs small?" +2022,cypress_city,270,greg,2022-05-05,,3,nestling,"4/7: chicks dry 4/21: Nest is in the cypress trees. 3/23: eggs small?" +2022,cypress_city,270,greg,2022-05-25,,,empty,"4/7: chicks dry 4/21: Nest is in the cypress trees. 3/23: eggs small?" +2022,cypress_city,345,greg,2022-03-17,,,,"1st nest on transect. 4/21: green paper 2 feet from nest #2, 4/29: paper pulled, 5/25: blue paper 2" +2022,cypress_city,345,greg,2022-03-23,2,,incubating,"1st nest on transect. 4/21: green paper 2 feet from nest #2, 4/29: paper pulled, 5/25: blue paper 2" +2022,cypress_city,345,greg,2022-03-31,2,,incubating,"1st nest on transect. 4/21: green paper 2 feet from nest #2, 4/29: paper pulled, 5/25: blue paper 2" +2022,cypress_city,345,greg,2022-04-07,2,,incubating,"1st nest on transect. 4/21: green paper 2 feet from nest #2, 4/29: paper pulled, 5/25: blue paper 2" +2022,cypress_city,345,greg,2022-04-14,1,1,wet_chick,"1st nest on transect. 4/21: green paper 2 feet from nest #2, 4/29: paper pulled, 5/25: blue paper 2" +2022,cypress_city,345,greg,2022-04-21,,2,chick_dry,"1st nest on transect. 4/21: green paper 2 feet from nest #2, 4/29: paper pulled, 5/25: blue paper 2" +2022,cypress_city,345,greg,2022-04-29,,2,nestling,"1st nest on transect. 4/21: green paper 2 feet from nest #2, 4/29: paper pulled, 5/25: blue paper 2" +2022,cypress_city,345,greg,2022-05-05,,2,nestling,"1st nest on transect. 4/21: green paper 2 feet from nest #2, 4/29: paper pulled, 5/25: blue paper 2" +2022,cypress_city,345,greg,2022-05-25,,,empty,"1st nest on transect. 4/21: green paper 2 feet from nest #2, 4/29: paper pulled, 5/25: blue paper 2" +2022,cypress_city,347,greg,2022-03-17,,,,"5/5: orange paper, 5/25: yellow paper 4" +2022,cypress_city,347,greg,2022-03-23,3,,incubating,"5/5: orange paper, 5/25: yellow paper 4" +2022,cypress_city,347,greg,2022-03-31,,,missed,"5/5: orange paper, 5/25: yellow paper 4" +2022,cypress_city,347,greg,2022-04-07,,,missed,"5/5: orange paper, 5/25: yellow paper 4" +2022,cypress_city,347,greg,2022-04-14,,,missed,"5/5: orange paper, 5/25: yellow paper 4" +2022,cypress_city,347,greg,2022-04-21,,3,nestling,"5/5: orange paper, 5/25: yellow paper 4" +2022,cypress_city,347,greg,2022-04-29,,,missed,"5/5: orange paper, 5/25: yellow paper 4" +2022,cypress_city,347,greg,2022-05-05,,,empty,"5/5: orange paper, 5/25: yellow paper 4" +2022,cypress_city,347,greg,2022-05-25,,,empty,"5/5: orange paper, 5/25: yellow paper 4" +2022,cypress_city,349,rosp,2022-03-17,,,,"4/21: blue paper in nest #3" +2022,cypress_city,349,rosp,2022-03-23,2,,incubating,"4/21: blue paper in nest #3" +2022,cypress_city,349,rosp,2022-03-31,,,empty,"4/21: blue paper in nest #3" +2022,cypress_city,349,rosp,2022-04-07,,,empty,"4/21: blue paper in nest #3" +2022,cypress_city,349,rosp,2022-04-14,,,empty,"4/21: blue paper in nest #3" +2022,cypress_city,349,rosp,2022-04-21,,,empty,"4/21: blue paper in nest #3" +2022,cypress_city,349,rosp,2022-04-29,,,empty,"4/21: blue paper in nest #3" +2022,cypress_city,349,rosp,2022-05-05,,,empty,"4/21: blue paper in nest #3" +2022,cypress_city,349,rosp,2022-05-25,,,empty,"4/21: blue paper in nest #3" +2022,cypress_city,351,rosp,2022-03-17,,,,"Before 222. 3/31 egg shells on ground, 4/14: dry chick, 5/25: pink paper 5" +2022,cypress_city,351,rosp,2022-03-23,3,,incubating,"Before 222. 3/31 egg shells on ground, 4/14: dry chick, 5/25: pink paper 5" +2022,cypress_city,351,rosp,2022-03-31,2,,incubating,"Before 222. 3/31 egg shells on ground, 4/14: dry chick, 5/25: pink paper 5" +2022,cypress_city,351,rosp,2022-04-07,2,,incubating,"Before 222. 3/31 egg shells on ground, 4/14: dry chick, 5/25: pink paper 5" +2022,cypress_city,351,rosp,2022-04-14,,2,chick_dry,"Before 222. 3/31 egg shells on ground, 4/14: dry chick, 5/25: pink paper 5" +2022,cypress_city,351,rosp,2022-04-21,,2,nestling,"Before 222. 3/31 egg shells on ground, 4/14: dry chick, 5/25: pink paper 5" +2022,cypress_city,351,rosp,2022-04-29,,2,nestling,"Before 222. 3/31 egg shells on ground, 4/14: dry chick, 5/25: pink paper 5" +2022,cypress_city,351,rosp,2022-05-05,,2,nestling,"Before 222. 3/31 egg shells on ground, 4/14: dry chick, 5/25: pink paper 5" +2022,cypress_city,351,rosp,2022-05-25,,,empty,"Before 222. 3/31 egg shells on ground, 4/14: dry chick, 5/25: pink paper 5" +2022,cypress_city,353,rosp,2022-03-17,,,,"Between 224 and 204. 4/14: dry chick" +2022,cypress_city,353,rosp,2022-03-23,3,,incubating,"Between 224 and 204. 4/14: dry chick" +2022,cypress_city,353,rosp,2022-03-31,3,,incubating,"Between 224 and 204. 4/14: dry chick" +2022,cypress_city,353,rosp,2022-04-07,3,,incubating,"Between 224 and 204. 4/14: dry chick" +2022,cypress_city,353,rosp,2022-04-14,,3,chick_dry,"Between 224 and 204. 4/14: dry chick" +2022,cypress_city,353,rosp,2022-04-21,,3,nestling,"Between 224 and 204. 4/14: dry chick" +2022,cypress_city,353,rosp,2022-04-29,,3,nestling,"Between 224 and 204. 4/14: dry chick" +2022,cypress_city,353,rosp,2022-05-05,,3,nestling,"Between 224 and 204. 4/14: dry chick" +2022,cypress_city,353,rosp,2022-05-25,,,empty,"Between 224 and 204. 4/14: dry chick" +2022,cypress_city,355,rosp,2022-03-17,,,,"Across from 224. 3/31 may be anhinga, 4/21: orange paper in nest #5, 4/29: paper pulled" +2022,cypress_city,355,rosp,2022-03-23,1,,incubating,"Across from 224. 3/31 may be anhinga, 4/21: orange paper in nest #5, 4/29: paper pulled" +2022,cypress_city,355,rosp,2022-03-31,3,,incubating,"Across from 224. 3/31 may be anhinga, 4/21: orange paper in nest #5, 4/29: paper pulled" +2022,cypress_city,355,rosp,2022-04-07,,,empty,"Across from 224. 3/31 may be anhinga, 4/21: orange paper in nest #5, 4/29: paper pulled" +2022,cypress_city,355,rosp,2022-04-14,,,empty,"Across from 224. 3/31 may be anhinga, 4/21: orange paper in nest #5, 4/29: paper pulled" +2022,cypress_city,355,rosp,2022-04-21,,,empty,"Across from 224. 3/31 may be anhinga, 4/21: orange paper in nest #5, 4/29: paper pulled" +2022,cypress_city,355,rosp,2022-04-29,,,empty,"Across from 224. 3/31 may be anhinga, 4/21: orange paper in nest #5, 4/29: paper pulled" +2022,cypress_city,355,rosp,2022-05-05,,,empty,"Across from 224. 3/31 may be anhinga, 4/21: orange paper in nest #5, 4/29: paper pulled" +2022,cypress_city,355,rosp,2022-05-25,,,empty,"Across from 224. 3/31 may be anhinga, 4/21: orange paper in nest #5, 4/29: paper pulled" +2022,cypress_city,357,rosp,2022-03-17,,,,"4/21: yellow paper in nest, 5/5: orange paper in nest #8" +2022,cypress_city,357,rosp,2022-03-23,1,,incubating,"4/21: yellow paper in nest, 5/5: orange paper in nest #8" +2022,cypress_city,357,rosp,2022-03-31,,,empty,"4/21: yellow paper in nest, 5/5: orange paper in nest #8" +2022,cypress_city,357,rosp,2022-04-07,,,empty,"4/21: yellow paper in nest, 5/5: orange paper in nest #8" +2022,cypress_city,357,rosp,2022-04-14,,,empty,"4/21: yellow paper in nest, 5/5: orange paper in nest #8" +2022,cypress_city,357,rosp,2022-04-21,,,empty,"4/21: yellow paper in nest, 5/5: orange paper in nest #8" +2022,cypress_city,357,rosp,2022-04-29,,,empty,"4/21: yellow paper in nest, 5/5: orange paper in nest #8" +2022,cypress_city,357,rosp,2022-05-05,,,empty,"4/21: yellow paper in nest, 5/5: orange paper in nest #8" +2022,cypress_city,357,rosp,2022-05-25,,,empty,"4/21: yellow paper in nest, 5/5: orange paper in nest #8" +2022,cypress_city,359,greg,2022-03-17,,,,"Next to 214. 4/14: just hatched, 5/25: blue paper next to 216" +2022,cypress_city,359,greg,2022-03-23,2,,incubating,"Next to 214. 4/14: just hatched, 5/25: blue paper next to 216" +2022,cypress_city,359,greg,2022-03-31,2,,incubating,"Next to 214. 4/14: just hatched, 5/25: blue paper next to 216" +2022,cypress_city,359,greg,2022-04-07,2,,incubating,"Next to 214. 4/14: just hatched, 5/25: blue paper next to 216" +2022,cypress_city,359,greg,2022-04-14,1,1,wet_chick,"Next to 214. 4/14: just hatched, 5/25: blue paper next to 216" +2022,cypress_city,359,greg,2022-04-21,,2,chick_dry,"Next to 214. 4/14: just hatched, 5/25: blue paper next to 216" +2022,cypress_city,359,greg,2022-04-29,,2,nestling,"Next to 214. 4/14: just hatched, 5/25: blue paper next to 216" +2022,cypress_city,359,greg,2022-05-05,,2,nestling,"Next to 214. 4/14: just hatched, 5/25: blue paper next to 216" +2022,cypress_city,359,greg,2022-05-25,,,empty,"Next to 214. 4/14: just hatched, 5/25: blue paper next to 216" +2022,cypress_city,361,greg,2022-03-17,,,,"Near 246. 5/5: at least one chick-large, ran away" +2022,cypress_city,361,greg,2022-03-23,3,,incubating,"Near 246. 5/5: at least one chick-large, ran away" +2022,cypress_city,361,greg,2022-03-31,3,,incubating,"Near 246. 5/5: at least one chick-large, ran away" +2022,cypress_city,361,greg,2022-04-07,,,missed,"Near 246. 5/5: at least one chick-large, ran away" +2022,cypress_city,361,greg,2022-04-14,,3,chick_dry,"Near 246. 5/5: at least one chick-large, ran away" +2022,cypress_city,361,greg,2022-04-21,,3,nestling,"Near 246. 5/5: at least one chick-large, ran away" +2022,cypress_city,361,greg,2022-04-29,,3,nestling,"Near 246. 5/5: at least one chick-large, ran away" +2022,cypress_city,361,greg,2022-05-05,,1,nestling,"Near 246. 5/5: at least one chick-large, ran away" +2022,cypress_city,361,greg,2022-05-25,,,empty,"Near 246. 5/5: at least one chick-large, ran away" +2022,cypress_city,363,rosp,2022-03-17,,,,"Near 252." +2022,cypress_city,363,rosp,2022-03-23,2,,incubating,"Near 252." +2022,cypress_city,363,rosp,2022-03-31,2,,incubating,"Near 252." +2022,cypress_city,363,rosp,2022-04-07,2,,incubating,"Near 252." +2022,cypress_city,363,rosp,2022-04-14,,2,nestling,"Near 252." +2022,cypress_city,363,rosp,2022-04-21,,1,nestling,"Near 252." +2022,cypress_city,363,rosp,2022-04-29,,1,nestling,"Near 252." +2022,cypress_city,363,rosp,2022-05-05,,1,nestling,"Near 252." +2022,cypress_city,363,rosp,2022-05-25,,,empty,"Near 252." +2022,cypress_city,365,greg,2022-03-17,,,,"After 256. 3/31: collapsed" +2022,cypress_city,365,greg,2022-03-23,1,,incubating,"After 256. 3/31: collapsed" +2022,cypress_city,365,greg,2022-03-31,,,collapsed,"After 256. 3/31: collapsed" +2022,cypress_city,365,greg,2022-04-07,,,pulled,"After 256. 3/31: collapsed" +2022,cypress_city,365,greg,2022-04-14,,,pulled,"After 256. 3/31: collapsed" +2022,cypress_city,365,greg,2022-04-21,,,,"After 256. 3/31: collapsed" +2022,cypress_city,365,greg,2022-04-29,,,,"After 256. 3/31: collapsed" +2022,cypress_city,365,greg,2022-05-05,,,,"After 256. 3/31: collapsed" +2022,cypress_city,365,greg,2022-05-25,,,missed,"After 256. 3/31: collapsed" +2022,cypress_city,367,rosp,2022-03-17,,,,"4/14: 2 chicks may be dead" +2022,cypress_city,367,rosp,2022-03-23,3,,incubating,"4/14: 2 chicks may be dead" +2022,cypress_city,367,rosp,2022-03-31,3,,incubating,"4/14: 2 chicks may be dead" +2022,cypress_city,367,rosp,2022-04-07,3,,incubating,"4/14: 2 chicks may be dead" +2022,cypress_city,367,rosp,2022-04-14,,3,nestling,"4/14: 2 chicks may be dead" +2022,cypress_city,367,rosp,2022-04-21,,3,nestling,"4/14: 2 chicks may be dead" +2022,cypress_city,367,rosp,2022-04-29,,3,nestling,"4/14: 2 chicks may be dead" +2022,cypress_city,367,rosp,2022-05-05,,3,nestling,"4/14: 2 chicks may be dead" +2022,cypress_city,367,rosp,2022-05-25,,,empty,"4/14: 2 chicks may be dead" +2022,cypress_city,369,greg,2022-03-17,,,,"Near 262. 5/25: pink paper" +2022,cypress_city,369,greg,2022-03-23,2,,incubating,"Near 262. 5/25: pink paper" +2022,cypress_city,369,greg,2022-03-31,2,,incubating,"Near 262. 5/25: pink paper" +2022,cypress_city,369,greg,2022-04-07,2,,incubating,"Near 262. 5/25: pink paper" +2022,cypress_city,369,greg,2022-04-14,1,1,hatching,"Near 262. 5/25: pink paper" +2022,cypress_city,369,greg,2022-04-21,,2,nestling,"Near 262. 5/25: pink paper" +2022,cypress_city,369,greg,2022-04-29,,2,nestling,"Near 262. 5/25: pink paper" +2022,cypress_city,369,greg,2022-05-05,,2,nestling,"Near 262. 5/25: pink paper" +2022,cypress_city,369,greg,2022-05-25,,,empty,"Near 262. 5/25: pink paper" +2022,cypress_city,371,greg,2022-03-17,,,,"4/7: chick dry, Before 270. 5/25: orange paper" +2022,cypress_city,371,greg,2022-03-23,3,,incubating,"4/7: chick dry, Before 270. 5/25: orange paper" +2022,cypress_city,371,greg,2022-03-31,3,,incubating,"4/7: chick dry, Before 270. 5/25: orange paper" +2022,cypress_city,371,greg,2022-04-07,1,2,incubating,"4/7: chick dry, Before 270. 5/25: orange paper" +2022,cypress_city,371,greg,2022-04-14,,3,nestling,"4/7: chick dry, Before 270. 5/25: orange paper" +2022,cypress_city,371,greg,2022-04-21,,3,nestling,"4/7: chick dry, Before 270. 5/25: orange paper" +2022,cypress_city,371,greg,2022-04-29,,,empty,"4/7: chick dry, Before 270. 5/25: orange paper" +2022,cypress_city,371,greg,2022-05-05,,,empty,"4/7: chick dry, Before 270. 5/25: orange paper" +2022,cypress_city,371,greg,2022-05-25,,,empty,"4/7: chick dry, Before 270. 5/25: orange paper" +2022,cypress_city,373,greg,2022-03-17,,,,"Before 270. 4/21: orange paper in nest #18, 5/25: yellow paper 2' to west" +2022,cypress_city,373,greg,2022-03-23,1,,incubating,"Before 270. 4/21: orange paper in nest #18, 5/25: yellow paper 2' to west" +2022,cypress_city,373,greg,2022-03-31,3,,incubating,"Before 270. 4/21: orange paper in nest #18, 5/25: yellow paper 2' to west" +2022,cypress_city,373,greg,2022-04-07,3,,incubating,"Before 270. 4/21: orange paper in nest #18, 5/25: yellow paper 2' to west" +2022,cypress_city,373,greg,2022-04-14,3,,incubating,"Before 270. 4/21: orange paper in nest #18, 5/25: yellow paper 2' to west" +2022,cypress_city,373,greg,2022-04-21,,,empty,"Before 270. 4/21: orange paper in nest #18, 5/25: yellow paper 2' to west" +2022,cypress_city,373,greg,2022-04-29,,,empty,"Before 270. 4/21: orange paper in nest #18, 5/25: yellow paper 2' to west" +2022,cypress_city,373,greg,2022-05-05,,,empty,"Before 270. 4/21: orange paper in nest #18, 5/25: yellow paper 2' to west" +2022,cypress_city,373,greg,2022-05-25,,,empty,"Before 270. 4/21: orange paper in nest #18, 5/25: yellow paper 2' to west" +2022,cypress_city,381,greg,2022-03-17,,,,"3/31: now 1st on transect, 4/14: collapsed, 4/21: pink paper in nest #1, 5/25: pink paper 1" +2022,cypress_city,381,greg,2022-03-23,,,,"3/31: now 1st on transect, 4/14: collapsed, 4/21: pink paper in nest #1, 5/25: pink paper 1" +2022,cypress_city,381,greg,2022-03-31,3,,incubating,"3/31: now 1st on transect, 4/14: collapsed, 4/21: pink paper in nest #1, 5/25: pink paper 1" +2022,cypress_city,381,greg,2022-04-07,3,,incubating,"3/31: now 1st on transect, 4/14: collapsed, 4/21: pink paper in nest #1, 5/25: pink paper 1" +2022,cypress_city,381,greg,2022-04-14,,,collapsed,"3/31: now 1st on transect, 4/14: collapsed, 4/21: pink paper in nest #1, 5/25: pink paper 1" +2022,cypress_city,381,greg,2022-04-21,,,,"3/31: now 1st on transect, 4/14: collapsed, 4/21: pink paper in nest #1, 5/25: pink paper 1" +2022,cypress_city,381,greg,2022-04-29,,,,"3/31: now 1st on transect, 4/14: collapsed, 4/21: pink paper in nest #1, 5/25: pink paper 1" +2022,cypress_city,381,greg,2022-05-05,,,,"3/31: now 1st on transect, 4/14: collapsed, 4/21: pink paper in nest #1, 5/25: pink paper 1" +2022,cypress_city,381,greg,2022-05-25,,,empty,"3/31: now 1st on transect, 4/14: collapsed, 4/21: pink paper in nest #1, 5/25: pink paper 1" +2022,cypress_city,383,greg,2022-03-17,,,,"4/14: one egg pipping and wet chick, 4/21: 1E pipping, 5/25: mercury sampled" +2022,cypress_city,383,greg,2022-03-23,,,,"4/14: one egg pipping and wet chick, 4/21: 1E pipping, 5/25: mercury sampled" +2022,cypress_city,383,greg,2022-03-31,3,,incubating,"4/14: one egg pipping and wet chick, 4/21: 1E pipping, 5/25: mercury sampled" +2022,cypress_city,383,greg,2022-04-07,3,,incubating,"4/14: one egg pipping and wet chick, 4/21: 1E pipping, 5/25: mercury sampled" +2022,cypress_city,383,greg,2022-04-14,2,1,wet_chick,"4/14: one egg pipping and wet chick, 4/21: 1E pipping, 5/25: mercury sampled" +2022,cypress_city,383,greg,2022-04-21,1,2,hatching,"4/14: one egg pipping and wet chick, 4/21: 1E pipping, 5/25: mercury sampled" +2022,cypress_city,383,greg,2022-04-29,,,missed,"4/14: one egg pipping and wet chick, 4/21: 1E pipping, 5/25: mercury sampled" +2022,cypress_city,383,greg,2022-05-05,,1,nestling,"4/14: one egg pipping and wet chick, 4/21: 1E pipping, 5/25: mercury sampled" +2022,cypress_city,383,greg,2022-05-25,,1,nestling,"4/14: one egg pipping and wet chick, 4/21: 1E pipping, 5/25: mercury sampled" +2022,cypress_city,385,rosp,2022-03-17,,,,"5/25: blue and yellow" +2022,cypress_city,385,rosp,2022-03-23,,,,"5/25: blue and yellow" +2022,cypress_city,385,rosp,2022-03-31,4,,incubating,"5/25: blue and yellow" +2022,cypress_city,385,rosp,2022-04-07,4,,incubating,"5/25: blue and yellow" +2022,cypress_city,385,rosp,2022-04-14,4,,incubating,"5/25: blue and yellow" +2022,cypress_city,385,rosp,2022-04-21,,4,chick_dry,"5/25: blue and yellow" +2022,cypress_city,385,rosp,2022-04-29,,4,nestling,"5/25: blue and yellow" +2022,cypress_city,385,rosp,2022-05-05,,4,nestling,"5/25: blue and yellow" +2022,cypress_city,385,rosp,2022-05-25,,,empty,"5/25: blue and yellow" +2022,cypress_city,387,rosp,2022-03-17,,,,"4/7: chick dry 4/14: one dead chick, 4/21: yellow paper in nest, 5/5: yellow paper #12" +2022,cypress_city,387,rosp,2022-03-23,,,,"4/7: chick dry 4/14: one dead chick, 4/21: yellow paper in nest, 5/5: yellow paper #12" +2022,cypress_city,387,rosp,2022-03-31,3,,incubating,"4/7: chick dry 4/14: one dead chick, 4/21: yellow paper in nest, 5/5: yellow paper #12" +2022,cypress_city,387,rosp,2022-04-07,2,1,incubating,"4/7: chick dry 4/14: one dead chick, 4/21: yellow paper in nest, 5/5: yellow paper #12" +2022,cypress_city,387,rosp,2022-04-14,,,empty,"4/7: chick dry 4/14: one dead chick, 4/21: yellow paper in nest, 5/5: yellow paper #12" +2022,cypress_city,387,rosp,2022-04-21,,,empty,"4/7: chick dry 4/14: one dead chick, 4/21: yellow paper in nest, 5/5: yellow paper #12" +2022,cypress_city,387,rosp,2022-04-29,,,empty,"4/7: chick dry 4/14: one dead chick, 4/21: yellow paper in nest, 5/5: yellow paper #12" +2022,cypress_city,387,rosp,2022-05-05,,,empty,"4/7: chick dry 4/14: one dead chick, 4/21: yellow paper in nest, 5/5: yellow paper #12" +2022,cypress_city,387,rosp,2022-05-25,,,empty,"4/7: chick dry 4/14: one dead chick, 4/21: yellow paper in nest, 5/5: yellow paper #12" +2022,cypress_city,422,rosp,2022-03-17,,,,"4/21: 1E pipping, orange paper 5 feet to N of nest on the ground #15, 5/25: 2c+" +2022,cypress_city,422,rosp,2022-03-23,,,,"4/21: 1E pipping, orange paper 5 feet to N of nest on the ground #15, 5/25: 2c+" +2022,cypress_city,422,rosp,2022-03-31,2,,incubating,"4/21: 1E pipping, orange paper 5 feet to N of nest on the ground #15, 5/25: 2c+" +2022,cypress_city,422,rosp,2022-04-07,3,,incubating,"4/21: 1E pipping, orange paper 5 feet to N of nest on the ground #15, 5/25: 2c+" +2022,cypress_city,422,rosp,2022-04-14,3,,incubating,"4/21: 1E pipping, orange paper 5 feet to N of nest on the ground #15, 5/25: 2c+" +2022,cypress_city,422,rosp,2022-04-21,2,1,pipping,"4/21: 1E pipping, orange paper 5 feet to N of nest on the ground #15, 5/25: 2c+" +2022,cypress_city,422,rosp,2022-04-29,,3,nestling,"4/21: 1E pipping, orange paper 5 feet to N of nest on the ground #15, 5/25: 2c+" +2022,cypress_city,422,rosp,2022-05-05,,3,nestling,"4/21: 1E pipping, orange paper 5 feet to N of nest on the ground #15, 5/25: 2c+" +2022,cypress_city,422,rosp,2022-05-25,,2,nestling,"4/21: 1E pipping, orange paper 5 feet to N of nest on the ground #15, 5/25: 2c+" +2022,cypress_city,435,rosp,2022-03-17,,,,"Next to 349. 4/14: chick dry" +2022,cypress_city,435,rosp,2022-03-23,,,,"Next to 349. 4/14: chick dry" +2022,cypress_city,435,rosp,2022-03-31,,,,"Next to 349. 4/14: chick dry" +2022,cypress_city,435,rosp,2022-04-07,3,,incubating,"Next to 349. 4/14: chick dry" +2022,cypress_city,435,rosp,2022-04-14,2,1,chick_dry,"Next to 349. 4/14: chick dry" +2022,cypress_city,435,rosp,2022-04-21,,3,nestling,"Next to 349. 4/14: chick dry" +2022,cypress_city,435,rosp,2022-04-29,,3,nestling,"Next to 349. 4/14: chick dry" +2022,cypress_city,435,rosp,2022-05-05,,2,nestling,"Next to 349. 4/14: chick dry" +2022,cypress_city,435,rosp,2022-05-25,,,empty,"Next to 349. 4/14: chick dry" +2022,cypress_city,437,rosp,2022-03-17,,,,"4/7: chick dry, After 212." +2022,cypress_city,437,rosp,2022-03-23,,,,"4/7: chick dry, After 212." +2022,cypress_city,437,rosp,2022-03-31,,,,"4/7: chick dry, After 212." +2022,cypress_city,437,rosp,2022-04-07,1,2,incubating,"4/7: chick dry, After 212." +2022,cypress_city,437,rosp,2022-04-14,1,2,hatching,"4/7: chick dry, After 212." +2022,cypress_city,437,rosp,2022-04-21,,2,nestling,"4/7: chick dry, After 212." +2022,cypress_city,437,rosp,2022-04-29,,2,nestling,"4/7: chick dry, After 212." +2022,cypress_city,437,rosp,2022-05-05,,1,nestling,"4/7: chick dry, After 212." +2022,cypress_city,437,rosp,2022-05-25,,,empty,"4/7: chick dry, After 212." +2022,cypress_city,439,rosp,2022-03-17,,,,"After 218. 5/25: 2c+" +2022,cypress_city,439,rosp,2022-03-23,,,,"After 218. 5/25: 2c+" +2022,cypress_city,439,rosp,2022-03-31,,,,"After 218. 5/25: 2c+" +2022,cypress_city,439,rosp,2022-04-07,3,,incubating,"After 218. 5/25: 2c+" +2022,cypress_city,439,rosp,2022-04-14,3,,incubating,"After 218. 5/25: 2c+" +2022,cypress_city,439,rosp,2022-04-21,1,2,chick_dry,"After 218. 5/25: 2c+" +2022,cypress_city,439,rosp,2022-04-29,,3,nestling,"After 218. 5/25: 2c+" +2022,cypress_city,439,rosp,2022-05-05,,3,nestling,"After 218. 5/25: 2c+" +2022,cypress_city,439,rosp,2022-05-25,,2,nestling,"After 218. 5/25: 2c+" +2022,cypress_city,441,rosp,2022-03-17,,,,"5/25: yellow paper" +2022,cypress_city,441,rosp,2022-03-23,,,,"5/25: yellow paper" +2022,cypress_city,441,rosp,2022-03-31,,,,"5/25: yellow paper" +2022,cypress_city,441,rosp,2022-04-07,4,,incubating,"5/25: yellow paper" +2022,cypress_city,441,rosp,2022-04-14,4,,incubating,"5/25: yellow paper" +2022,cypress_city,441,rosp,2022-04-21,,4,nestling,"5/25: yellow paper" +2022,cypress_city,441,rosp,2022-04-29,,4,nestling,"5/25: yellow paper" +2022,cypress_city,441,rosp,2022-05-05,,4,nestling,"5/25: yellow paper" +2022,cypress_city,441,rosp,2022-05-25,,,empty,"5/25: yellow paper" +2022,cypress_city,443,rosp,2022-03-17,,,,"Next to 254." +2022,cypress_city,443,rosp,2022-03-23,,,,"Next to 254." +2022,cypress_city,443,rosp,2022-03-31,,,,"Next to 254." +2022,cypress_city,443,rosp,2022-04-07,3,,incubating,"Next to 254." +2022,cypress_city,443,rosp,2022-04-14,2,1,hatching,"Next to 254." +2022,cypress_city,443,rosp,2022-04-21,1,2,hatching,"Next to 254." +2022,cypress_city,443,rosp,2022-04-29,,2,nestling,"Next to 254." +2022,cypress_city,443,rosp,2022-05-05,,2,nestling,"Next to 254." +2022,cypress_city,443,rosp,2022-05-25,,,empty,"Next to 254." +2022,6th_bridge,11,bcnh,2022-02-19,3,,incubating,"4/21: gone" +2022,6th_bridge,11,bcnh,2022-02-24,3,,incubating,"4/21: gone" +2022,6th_bridge,11,bcnh,2022-03-03,3,,incubating,"4/21: gone" +2022,6th_bridge,11,bcnh,2022-03-17,,3,nestling,"4/21: gone" +2022,6th_bridge,11,bcnh,2022-03-23,,2,nestling,"4/21: gone" +2022,6th_bridge,11,bcnh,2022-03-31,,1,nestling,"4/21: gone" +2022,6th_bridge,11,bcnh,2022-04-07,,,empty,"4/21: gone" +2022,6th_bridge,11,bcnh,2022-04-14,,,empty,"4/21: gone" +2022,6th_bridge,11,bcnh,2022-04-21,,,,"4/21: gone" +2022,6th_bridge,13,bcnh,2022-02-19,3,,incubating,"4/14: big chick, 4/21: huge" +2022,6th_bridge,13,bcnh,2022-02-24,3,,incubating,"4/14: big chick, 4/21: huge" +2022,6th_bridge,13,bcnh,2022-03-03,3,,incubating,"4/14: big chick, 4/21: huge" +2022,6th_bridge,13,bcnh,2022-03-17,,2,nestling,"4/14: big chick, 4/21: huge" +2022,6th_bridge,13,bcnh,2022-03-23,,1,nestling,"4/14: big chick, 4/21: huge" +2022,6th_bridge,13,bcnh,2022-03-31,,1,nestling,"4/14: big chick, 4/21: huge" +2022,6th_bridge,13,bcnh,2022-04-07,,1,nestling,"4/14: big chick, 4/21: huge" +2022,6th_bridge,13,bcnh,2022-04-14,,1,nestling,"4/14: big chick, 4/21: huge" +2022,6th_bridge,13,bcnh,2022-04-21,,1,nestling,"4/14: big chick, 4/21: huge" +2022,6th_bridge,15,bcnh,2022-02-19,1,,incubating,"3/23: nest on the ground, gone? 4/7: confirmed to be gone, 4/21: gone" +2022,6th_bridge,15,bcnh,2022-02-24,,,empty,"3/23: nest on the ground, gone? 4/7: confirmed to be gone, 4/21: gone" +2022,6th_bridge,15,bcnh,2022-03-03,,,empty,"3/23: nest on the ground, gone? 4/7: confirmed to be gone, 4/21: gone" +2022,6th_bridge,15,bcnh,2022-03-17,,,empty,"3/23: nest on the ground, gone? 4/7: confirmed to be gone, 4/21: gone" +2022,6th_bridge,15,bcnh,2022-03-23,,,,"3/23: nest on the ground, gone? 4/7: confirmed to be gone, 4/21: gone" +2022,6th_bridge,15,bcnh,2022-03-31,,,missed,"3/23: nest on the ground, gone? 4/7: confirmed to be gone, 4/21: gone" +2022,6th_bridge,15,bcnh,2022-04-07,,,,"3/23: nest on the ground, gone? 4/7: confirmed to be gone, 4/21: gone" +2022,6th_bridge,15,bcnh,2022-04-14,,,missed,"3/23: nest on the ground, gone? 4/7: confirmed to be gone, 4/21: gone" +2022,6th_bridge,15,bcnh,2022-04-21,,,,"3/23: nest on the ground, gone? 4/7: confirmed to be gone, 4/21: gone" +2022,6th_bridge,17,bcnh,2022-02-19,2,,incubating,"3/31: smhe relay? 4/14: smhe, 4/21: smwh, dry" +2022,6th_bridge,17,bcnh,2022-02-24,4,,incubating,"3/31: smhe relay? 4/14: smhe, 4/21: smwh, dry" +2022,6th_bridge,17,bcnh,2022-03-03,,,empty,"3/31: smhe relay? 4/14: smhe, 4/21: smwh, dry" +2022,6th_bridge,17,bcnh,2022-03-17,1,,incubating,"3/31: smhe relay? 4/14: smhe, 4/21: smwh, dry" +2022,6th_bridge,17,bcnh,2022-03-23,,,empty,"3/31: smhe relay? 4/14: smhe, 4/21: smwh, dry" +2022,6th_bridge,17,bcnh,2022-03-31,2,,incubating,"3/31: smhe relay? 4/14: smhe, 4/21: smwh, dry" +2022,6th_bridge,17,bcnh,2022-04-07,3,,incubating,"3/31: smhe relay? 4/14: smhe, 4/21: smwh, dry" +2022,6th_bridge,17,bcnh,2022-04-14,3,,incubating,"3/31: smhe relay? 4/14: smhe, 4/21: smwh, dry" +2022,6th_bridge,17,bcnh,2022-04-21,1,2,hatching,"3/31: smhe relay? 4/14: smhe, 4/21: smwh, dry" +2022,6th_bridge,2,bcnh,2022-02-19,3,,incubating,"2/24: broken shells under, 3/23: collapsed, 3/31: gone" +2022,6th_bridge,2,bcnh,2022-02-24,,,empty,"2/24: broken shells under, 3/23: collapsed, 3/31: gone" +2022,6th_bridge,2,bcnh,2022-03-03,,,empty,"2/24: broken shells under, 3/23: collapsed, 3/31: gone" +2022,6th_bridge,2,bcnh,2022-03-17,,,missed,"2/24: broken shells under, 3/23: collapsed, 3/31: gone" +2022,6th_bridge,2,bcnh,2022-03-23,,,,"2/24: broken shells under, 3/23: collapsed, 3/31: gone" +2022,6th_bridge,2,bcnh,2022-03-31,,,,"2/24: broken shells under, 3/23: collapsed, 3/31: gone" +2022,6th_bridge,2,bcnh,2022-04-07,,,,"2/24: broken shells under, 3/23: collapsed, 3/31: gone" +2022,6th_bridge,2,bcnh,2022-04-14,,,missed,"2/24: broken shells under, 3/23: collapsed, 3/31: gone" +2022,6th_bridge,2,bcnh,2022-04-21,,,,"2/24: broken shells under, 3/23: collapsed, 3/31: gone" +2022,6th_bridge,19,bcnh,2022-02-19,3,,incubating,"2/24: eggshells, 4/14: confirmed gone, 4/21: gone" +2022,6th_bridge,19,bcnh,2022-02-24,,,empty,"2/24: eggshells, 4/14: confirmed gone, 4/21: gone" +2022,6th_bridge,19,bcnh,2022-03-03,,,empty,"2/24: eggshells, 4/14: confirmed gone, 4/21: gone" +2022,6th_bridge,19,bcnh,2022-03-17,,,missed,"2/24: eggshells, 4/14: confirmed gone, 4/21: gone" +2022,6th_bridge,19,bcnh,2022-03-23,,,missed,"2/24: eggshells, 4/14: confirmed gone, 4/21: gone" +2022,6th_bridge,19,bcnh,2022-03-31,,,missed,"2/24: eggshells, 4/14: confirmed gone, 4/21: gone" +2022,6th_bridge,19,bcnh,2022-04-07,,,missed,"2/24: eggshells, 4/14: confirmed gone, 4/21: gone" +2022,6th_bridge,19,bcnh,2022-04-14,,,empty,"2/24: eggshells, 4/14: confirmed gone, 4/21: gone" +2022,6th_bridge,19,bcnh,2022-04-21,,,,"2/24: eggshells, 4/14: confirmed gone, 4/21: gone" +2022,6th_bridge,21,bcnh,2022-02-19,1,,incubating,"2/24: broken egg, 4/7: gone, 4/14: smhe relay" +2022,6th_bridge,21,bcnh,2022-02-24,,,empty,"2/24: broken egg, 4/7: gone, 4/14: smhe relay" +2022,6th_bridge,21,bcnh,2022-03-03,,,empty,"2/24: broken egg, 4/7: gone, 4/14: smhe relay" +2022,6th_bridge,21,bcnh,2022-03-17,3,,incubating,"2/24: broken egg, 4/7: gone, 4/14: smhe relay" +2022,6th_bridge,21,bcnh,2022-03-23,3,,incubating,"2/24: broken egg, 4/7: gone, 4/14: smhe relay" +2022,6th_bridge,21,bcnh,2022-03-31,3,,incubating,"2/24: broken egg, 4/7: gone, 4/14: smhe relay" +2022,6th_bridge,21,bcnh,2022-04-07,,,empty,"2/24: broken egg, 4/7: gone, 4/14: smhe relay" +2022,6th_bridge,21,bcnh,2022-04-14,3,,incubating,"2/24: broken egg, 4/7: gone, 4/14: smhe relay" +2022,6th_bridge,21,bcnh,2022-04-21,3,,incubating,"2/24: broken egg, 4/7: gone, 4/14: smhe relay" +2022,6th_bridge,23,bcnh,2022-02-19,3,,incubating,"3/23: eggs probably dead, 4/21: 1 really dead chick" +2022,6th_bridge,23,bcnh,2022-02-24,3,,incubating,"3/23: eggs probably dead, 4/21: 1 really dead chick" +2022,6th_bridge,23,bcnh,2022-03-03,3,,incubating,"3/23: eggs probably dead, 4/21: 1 really dead chick" +2022,6th_bridge,23,bcnh,2022-03-17,,2,nestling,"3/23: eggs probably dead, 4/21: 1 really dead chick" +2022,6th_bridge,23,bcnh,2022-03-23,2,1,hatching,"3/23: eggs probably dead, 4/21: 1 really dead chick" +2022,6th_bridge,23,bcnh,2022-03-31,,,empty,"3/23: eggs probably dead, 4/21: 1 really dead chick" +2022,6th_bridge,23,bcnh,2022-04-07,,,empty,"3/23: eggs probably dead, 4/21: 1 really dead chick" +2022,6th_bridge,23,bcnh,2022-04-14,,,empty,"3/23: eggs probably dead, 4/21: 1 really dead chick" +2022,6th_bridge,23,bcnh,2022-04-21,,,empty,"3/23: eggs probably dead, 4/21: 1 really dead chick" +2022,6th_bridge,25,bcnh,2022-02-19,2,,incubating,"3/23: change to small heron, renesting, 3/31: smhe, 4/21: smwh" +2022,6th_bridge,25,bcnh,2022-02-24,2,,incubating,"3/23: change to small heron, renesting, 3/31: smhe, 4/21: smwh" +2022,6th_bridge,25,bcnh,2022-03-03,,,empty,"3/23: change to small heron, renesting, 3/31: smhe, 4/21: smwh" +2022,6th_bridge,25,bcnh,2022-03-17,,,missed,"3/23: change to small heron, renesting, 3/31: smhe, 4/21: smwh" +2022,6th_bridge,25,bcnh,2022-03-23,3,,incubating,"3/23: change to small heron, renesting, 3/31: smhe, 4/21: smwh" +2022,6th_bridge,25,bcnh,2022-03-31,3,,incubating,"3/23: change to small heron, renesting, 3/31: smhe, 4/21: smwh" +2022,6th_bridge,25,bcnh,2022-04-07,2,,incubating,"3/23: change to small heron, renesting, 3/31: smhe, 4/21: smwh" +2022,6th_bridge,25,bcnh,2022-04-14,,,missed,"3/23: change to small heron, renesting, 3/31: smhe, 4/21: smwh" +2022,6th_bridge,25,bcnh,2022-04-21,1,1,hatching,"3/23: change to small heron, renesting, 3/31: smhe, 4/21: smwh" +2022,6th_bridge,4,rosp,2022-02-19,3,,incubating,"This is nest 4, different than 04 which is also in this colony. 4/7: chicks in trees, 4/21: third chick in tree" +2022,6th_bridge,4,rosp,2022-02-24,3,,incubating,"This is nest 4, different than 04 which is also in this colony. 4/7: chicks in trees, 4/21: third chick in tree" +2022,6th_bridge,4,rosp,2022-03-03,3,,incubating,"This is nest 4, different than 04 which is also in this colony. 4/7: chicks in trees, 4/21: third chick in tree" +2022,6th_bridge,4,rosp,2022-03-17,,,missed,"This is nest 4, different than 04 which is also in this colony. 4/7: chicks in trees, 4/21: third chick in tree" +2022,6th_bridge,4,rosp,2022-03-23,,3,nestling,"This is nest 4, different than 04 which is also in this colony. 4/7: chicks in trees, 4/21: third chick in tree" +2022,6th_bridge,4,rosp,2022-03-31,,3,nestling,"This is nest 4, different than 04 which is also in this colony. 4/7: chicks in trees, 4/21: third chick in tree" +2022,6th_bridge,4,rosp,2022-04-07,,3,branchling,"This is nest 4, different than 04 which is also in this colony. 4/7: chicks in trees, 4/21: third chick in tree" +2022,6th_bridge,4,rosp,2022-04-14,,,empty,"This is nest 4, different than 04 which is also in this colony. 4/7: chicks in trees, 4/21: third chick in tree" +2022,6th_bridge,4,rosp,2022-04-21,,,empty,"This is nest 4, different than 04 which is also in this colony. 4/7: chicks in trees, 4/21: third chick in tree" +2022,6th_bridge,27,rosp,2022-02-19,3,,incubating,"4/7: marked as WHIB. Not sure if relay or reclassification of species" +2022,6th_bridge,27,rosp,2022-02-24,3,,incubating,"4/7: marked as WHIB. Not sure if relay or reclassification of species" +2022,6th_bridge,27,rosp,2022-03-03,3,,incubating,"4/7: marked as WHIB. Not sure if relay or reclassification of species" +2022,6th_bridge,27,rosp,2022-03-17,,,missed,"4/7: marked as WHIB. Not sure if relay or reclassification of species" +2022,6th_bridge,27,rosp,2022-03-23,2,,incubating,"4/7: marked as WHIB. Not sure if relay or reclassification of species" +2022,6th_bridge,27,rosp,2022-03-31,3,,incubating,"4/7: marked as WHIB. Not sure if relay or reclassification of species" +2022,6th_bridge,27,rosp,2022-04-07,3,,incubating,"4/7: marked as WHIB. Not sure if relay or reclassification of species" +2022,6th_bridge,27,rosp,2022-04-14,2,1,hatching,"4/7: marked as WHIB. Not sure if relay or reclassification of species" +2022,6th_bridge,27,rosp,2022-04-21,,2,nestling,"4/7: marked as WHIB. Not sure if relay or reclassification of species" +2022,6th_bridge,29,rosp,2022-02-19,4,,incubating,"3/23: eggshells on the ground, collapsed, 3/31: relay, 4/7: gone, 4/21: gone" +2022,6th_bridge,29,rosp,2022-02-24,3,,incubating,"3/23: eggshells on the ground, collapsed, 3/31: relay, 4/7: gone, 4/21: gone" +2022,6th_bridge,29,rosp,2022-03-03,,,empty,"3/23: eggshells on the ground, collapsed, 3/31: relay, 4/7: gone, 4/21: gone" +2022,6th_bridge,29,rosp,2022-03-17,,,missed,"3/23: eggshells on the ground, collapsed, 3/31: relay, 4/7: gone, 4/21: gone" +2022,6th_bridge,29,rosp,2022-03-23,,,,"3/23: eggshells on the ground, collapsed, 3/31: relay, 4/7: gone, 4/21: gone" +2022,6th_bridge,29,rosp,2022-03-31,3,,incubating,"3/23: eggshells on the ground, collapsed, 3/31: relay, 4/7: gone, 4/21: gone" +2022,6th_bridge,29,rosp,2022-04-07,,,empty,"3/23: eggshells on the ground, collapsed, 3/31: relay, 4/7: gone, 4/21: gone" +2022,6th_bridge,29,rosp,2022-04-14,,,,"3/23: eggshells on the ground, collapsed, 3/31: relay, 4/7: gone, 4/21: gone" +2022,6th_bridge,29,rosp,2022-04-21,,,,"3/23: eggshells on the ground, collapsed, 3/31: relay, 4/7: gone, 4/21: gone" +2022,6th_bridge,6,bcnh,2022-02-19,3,,incubating,"3/3: eggshells on the ground, 3/23: gone, 4/21: gone" +2022,6th_bridge,6,bcnh,2022-02-24,,,empty,"3/3: eggshells on the ground, 3/23: gone, 4/21: gone" +2022,6th_bridge,6,bcnh,2022-03-03,,,empty,"3/3: eggshells on the ground, 3/23: gone, 4/21: gone" +2022,6th_bridge,6,bcnh,2022-03-17,,,missed,"3/3: eggshells on the ground, 3/23: gone, 4/21: gone" +2022,6th_bridge,6,bcnh,2022-03-23,,,,"3/3: eggshells on the ground, 3/23: gone, 4/21: gone" +2022,6th_bridge,6,bcnh,2022-03-31,,,,"3/3: eggshells on the ground, 3/23: gone, 4/21: gone" +2022,6th_bridge,6,bcnh,2022-04-07,,,,"3/3: eggshells on the ground, 3/23: gone, 4/21: gone" +2022,6th_bridge,6,bcnh,2022-04-14,,,,"3/3: eggshells on the ground, 3/23: gone, 4/21: gone" +2022,6th_bridge,6,bcnh,2022-04-21,,,,"3/3: eggshells on the ground, 3/23: gone, 4/21: gone" +2022,6th_bridge,31,greg,2022-02-19,2,,incubating,"GPS N31. 3/3: collapsed, 3/23: gone" +2022,6th_bridge,31,greg,2022-02-24,,,empty,"GPS N31. 3/3: collapsed, 3/23: gone" +2022,6th_bridge,31,greg,2022-03-03,,,empty,"GPS N31. 3/3: collapsed, 3/23: gone" +2022,6th_bridge,31,greg,2022-03-17,,,missed,"GPS N31. 3/3: collapsed, 3/23: gone" +2022,6th_bridge,31,greg,2022-03-23,,,,"GPS N31. 3/3: collapsed, 3/23: gone" +2022,6th_bridge,31,greg,2022-03-31,,,,"GPS N31. 3/3: collapsed, 3/23: gone" +2022,6th_bridge,31,greg,2022-04-07,,,,"GPS N31. 3/3: collapsed, 3/23: gone" +2022,6th_bridge,31,greg,2022-04-14,,,,"GPS N31. 3/3: collapsed, 3/23: gone" +2022,6th_bridge,31,greg,2022-04-21,,,,"GPS N31. 3/3: collapsed, 3/23: gone" +2022,6th_bridge,33,bcnh,2022-02-19,3,,incubating,"3/23: big, loud" +2022,6th_bridge,33,bcnh,2022-02-24,3,,incubating,"3/23: big, loud" +2022,6th_bridge,33,bcnh,2022-03-03,3,,incubating,"3/23: big, loud" +2022,6th_bridge,33,bcnh,2022-03-17,,,missed,"3/23: big, loud" +2022,6th_bridge,33,bcnh,2022-03-23,,2,nestling,"3/23: big, loud" +2022,6th_bridge,33,bcnh,2022-03-31,,1,nestling,"3/23: big, loud" +2022,6th_bridge,33,bcnh,2022-04-07,,,empty,"3/23: big, loud" +2022,6th_bridge,33,bcnh,2022-04-14,,,missed,"3/23: big, loud" +2022,6th_bridge,33,bcnh,2022-04-21,,,missed,"3/23: big, loud" +2022,6th_bridge,8,greg,2022-02-19,2,,incubating,"GPS N8. 4/14: at least one chick, may be more" +2022,6th_bridge,8,greg,2022-02-24,2,,incubating,"GPS N8. 4/14: at least one chick, may be more" +2022,6th_bridge,8,greg,2022-03-03,2,,incubating,"GPS N8. 4/14: at least one chick, may be more" +2022,6th_bridge,8,greg,2022-03-17,,,missed,"GPS N8. 4/14: at least one chick, may be more" +2022,6th_bridge,8,greg,2022-03-23,,2,nestling,"GPS N8. 4/14: at least one chick, may be more" +2022,6th_bridge,8,greg,2022-03-31,,2,nestling,"GPS N8. 4/14: at least one chick, may be more" +2022,6th_bridge,8,greg,2022-04-07,,2,nestling,"GPS N8. 4/14: at least one chick, may be more" +2022,6th_bridge,8,greg,2022-04-14,,1,branchling,"GPS N8. 4/14: at least one chick, may be more" +2022,6th_bridge,8,greg,2022-04-21,,,empty,"GPS N8. 4/14: at least one chick, may be more" +2022,6th_bridge,35,greg,2022-02-19,,2,nestling,"4/7: gone" +2022,6th_bridge,35,greg,2022-02-24,,2,nestling,"4/7: gone" +2022,6th_bridge,35,greg,2022-03-03,,2,nestling,"4/7: gone" +2022,6th_bridge,35,greg,2022-03-17,,,missed,"4/7: gone" +2022,6th_bridge,35,greg,2022-03-23,,,empty,"4/7: gone" +2022,6th_bridge,35,greg,2022-03-31,,,empty,"4/7: gone" +2022,6th_bridge,35,greg,2022-04-07,,,,"4/7: gone" +2022,6th_bridge,35,greg,2022-04-14,,,,"4/7: gone" +2022,6th_bridge,35,greg,2022-04-21,,,,"4/7: gone" +2022,6th_bridge,10,greg,2022-02-19,3,,incubating, +2022,6th_bridge,10,greg,2022-02-24,3,,incubating, +2022,6th_bridge,10,greg,2022-03-03,3,,incubating, +2022,6th_bridge,10,greg,2022-03-17,,,missed, +2022,6th_bridge,10,greg,2022-03-23,,3,nestling, +2022,6th_bridge,10,greg,2022-03-31,,2,nestling, +2022,6th_bridge,10,greg,2022-04-07,,2,nestling, +2022,6th_bridge,10,greg,2022-04-14,,,empty, +2022,6th_bridge,10,greg,2022-04-21,,,, +2022,6th_bridge,12,greg,2022-02-19,3,,incubating,"3/31: one dead chick also, 4/21: 1c dead" +2022,6th_bridge,12,greg,2022-02-24,3,,incubating,"3/31: one dead chick also, 4/21: 1c dead" +2022,6th_bridge,12,greg,2022-03-03,3,,incubating,"3/31: one dead chick also, 4/21: 1c dead" +2022,6th_bridge,12,greg,2022-03-17,,,missed,"3/31: one dead chick also, 4/21: 1c dead" +2022,6th_bridge,12,greg,2022-03-23,,2,nestling,"3/31: one dead chick also, 4/21: 1c dead" +2022,6th_bridge,12,greg,2022-03-31,,1,nestling,"3/31: one dead chick also, 4/21: 1c dead" +2022,6th_bridge,12,greg,2022-04-07,,1,nestling,"3/31: one dead chick also, 4/21: 1c dead" +2022,6th_bridge,12,greg,2022-04-14,,1,nestling,"3/31: one dead chick also, 4/21: 1c dead" +2022,6th_bridge,12,greg,2022-04-21,,,empty,"3/31: one dead chick also, 4/21: 1c dead" +2022,6th_bridge,14,greg,2022-02-19,3,,incubating,"3/23: oldest ~1 week old, 4/7: illegible note + something" +2022,6th_bridge,14,greg,2022-02-24,3,,incubating,"3/23: oldest ~1 week old, 4/7: illegible note + something" +2022,6th_bridge,14,greg,2022-03-03,3,,incubating,"3/23: oldest ~1 week old, 4/7: illegible note + something" +2022,6th_bridge,14,greg,2022-03-17,,,missed,"3/23: oldest ~1 week old, 4/7: illegible note + something" +2022,6th_bridge,14,greg,2022-03-23,,3,nestling,"3/23: oldest ~1 week old, 4/7: illegible note + something" +2022,6th_bridge,14,greg,2022-03-31,,2,nestling,"3/23: oldest ~1 week old, 4/7: illegible note + something" +2022,6th_bridge,14,greg,2022-04-07,,1,nestling,"3/23: oldest ~1 week old, 4/7: illegible note + something" +2022,6th_bridge,14,greg,2022-04-14,,2,nestling,"3/23: oldest ~1 week old, 4/7: illegible note + something" +2022,6th_bridge,14,greg,2022-04-21,,,empty,"3/23: oldest ~1 week old, 4/7: illegible note + something" +2022,6th_bridge,37,greg,2022-02-19,2,,incubating,"2/24: pulled, gone" +2022,6th_bridge,37,greg,2022-02-24,,,empty,"2/24: pulled, gone" +2022,6th_bridge,37,greg,2022-03-03,,,,"2/24: pulled, gone" +2022,6th_bridge,37,greg,2022-03-17,,,,"2/24: pulled, gone" +2022,6th_bridge,37,greg,2022-03-23,,,,"2/24: pulled, gone" +2022,6th_bridge,37,greg,2022-03-31,,,,"2/24: pulled, gone" +2022,6th_bridge,37,greg,2022-04-07,,,,"2/24: pulled, gone" +2022,6th_bridge,37,greg,2022-04-14,,,,"2/24: pulled, gone" +2022,6th_bridge,37,greg,2022-04-21,,,,"2/24: pulled, gone" +2022,6th_bridge,39,greg,2022-02-19,1,2,hatching,"Up on top of vines. 3/23: chicks recorded as 2+ C, more than 2 possible 4/7: 1C+ at least one chick, 4/14: gone" +2022,6th_bridge,39,greg,2022-02-24,,3,nestling,"Up on top of vines. 3/23: chicks recorded as 2+ C, more than 2 possible 4/7: 1C+ at least one chick, 4/14: gone" +2022,6th_bridge,39,greg,2022-03-03,,3,nestling,"Up on top of vines. 3/23: chicks recorded as 2+ C, more than 2 possible 4/7: 1C+ at least one chick, 4/14: gone" +2022,6th_bridge,39,greg,2022-03-17,,,missed,"Up on top of vines. 3/23: chicks recorded as 2+ C, more than 2 possible 4/7: 1C+ at least one chick, 4/14: gone" +2022,6th_bridge,39,greg,2022-03-23,,2,nestling,"Up on top of vines. 3/23: chicks recorded as 2+ C, more than 2 possible 4/7: 1C+ at least one chick, 4/14: gone" +2022,6th_bridge,39,greg,2022-03-31,,,empty,"Up on top of vines. 3/23: chicks recorded as 2+ C, more than 2 possible 4/7: 1C+ at least one chick, 4/14: gone" +2022,6th_bridge,39,greg,2022-04-07,,1,nestling,"Up on top of vines. 3/23: chicks recorded as 2+ C, more than 2 possible 4/7: 1C+ at least one chick, 4/14: gone" +2022,6th_bridge,39,greg,2022-04-14,,,empty,"Up on top of vines. 3/23: chicks recorded as 2+ C, more than 2 possible 4/7: 1C+ at least one chick, 4/14: gone" +2022,6th_bridge,39,greg,2022-04-21,,,empty,"Up on top of vines. 3/23: chicks recorded as 2+ C, more than 2 possible 4/7: 1C+ at least one chick, 4/14: gone" +2022,6th_bridge,41,bcnh,2022-02-19,3,,incubating,"2/24: eggshell" +2022,6th_bridge,41,bcnh,2022-02-24,,,empty,"2/24: eggshell" +2022,6th_bridge,41,bcnh,2022-03-03,,,missed,"2/24: eggshell" +2022,6th_bridge,41,bcnh,2022-03-17,,,missed,"2/24: eggshell" +2022,6th_bridge,41,bcnh,2022-03-23,,,missed,"2/24: eggshell" +2022,6th_bridge,41,bcnh,2022-03-31,,,missed,"2/24: eggshell" +2022,6th_bridge,41,bcnh,2022-04-07,,,missed,"2/24: eggshell" +2022,6th_bridge,41,bcnh,2022-04-14,,,missed,"2/24: eggshell" +2022,6th_bridge,41,bcnh,2022-04-21,,,missed,"2/24: eggshell" +2022,6th_bridge,16,greg,2022-02-19,3,,incubating,"3/23: 1-2 weeks old +possible branch nestling, 4/14: possible branchling" +2022,6th_bridge,16,greg,2022-02-24,3,,incubating,"3/23: 1-2 weeks old +possible branch nestling, 4/14: possible branchling" +2022,6th_bridge,16,greg,2022-03-03,3,,incubating,"3/23: 1-2 weeks old +possible branch nestling, 4/14: possible branchling" +2022,6th_bridge,16,greg,2022-03-17,,,missed,"3/23: 1-2 weeks old +possible branch nestling, 4/14: possible branchling" +2022,6th_bridge,16,greg,2022-03-23,,1,nestling,"3/23: 1-2 weeks old +possible branch nestling, 4/14: possible branchling" +2022,6th_bridge,16,greg,2022-03-31,,1,nestling,"3/23: 1-2 weeks old +possible branch nestling, 4/14: possible branchling" +2022,6th_bridge,16,greg,2022-04-07,,1,nestling,"3/23: 1-2 weeks old +possible branch nestling, 4/14: possible branchling" +2022,6th_bridge,16,greg,2022-04-14,,,empty,"3/23: 1-2 weeks old +possible branch nestling, 4/14: possible branchling" +2022,6th_bridge,16,greg,2022-04-21,,,missed,"3/23: 1-2 weeks old +possible branch nestling, 4/14: possible branchling" +2022,6th_bridge,18,greg,2022-02-19,2,,incubating,"3/23: partially collapsed, 3/31: gone, 4/7: gone, 4/14: 1c ran" +2022,6th_bridge,18,greg,2022-02-24,2,,incubating,"3/23: partially collapsed, 3/31: gone, 4/7: gone, 4/14: 1c ran" +2022,6th_bridge,18,greg,2022-03-03,2,,incubating,"3/23: partially collapsed, 3/31: gone, 4/7: gone, 4/14: 1c ran" +2022,6th_bridge,18,greg,2022-03-17,,,missed,"3/23: partially collapsed, 3/31: gone, 4/7: gone, 4/14: 1c ran" +2022,6th_bridge,18,greg,2022-03-23,,,empty,"3/23: partially collapsed, 3/31: gone, 4/7: gone, 4/14: 1c ran" +2022,6th_bridge,18,greg,2022-03-31,,,,"3/23: partially collapsed, 3/31: gone, 4/7: gone, 4/14: 1c ran" +2022,6th_bridge,18,greg,2022-04-07,,,,"3/23: partially collapsed, 3/31: gone, 4/7: gone, 4/14: 1c ran" +2022,6th_bridge,18,greg,2022-04-14,,1,branchling,"3/23: partially collapsed, 3/31: gone, 4/7: gone, 4/14: 1c ran" +2022,6th_bridge,18,greg,2022-04-21,,,empty,"3/23: partially collapsed, 3/31: gone, 4/7: gone, 4/14: 1c ran" +2022,6th_bridge,43,greg,2022-02-19,2,,incubating,"3/23: ~5 days old, 4/14: maybe 2 more chicks, 4/21: 1c dead" +2022,6th_bridge,43,greg,2022-02-24,2,,incubating,"3/23: ~5 days old, 4/14: maybe 2 more chicks, 4/21: 1c dead" +2022,6th_bridge,43,greg,2022-03-03,,,missed,"3/23: ~5 days old, 4/14: maybe 2 more chicks, 4/21: 1c dead" +2022,6th_bridge,43,greg,2022-03-17,,,missed,"3/23: ~5 days old, 4/14: maybe 2 more chicks, 4/21: 1c dead" +2022,6th_bridge,43,greg,2022-03-23,,2,nestling,"3/23: ~5 days old, 4/14: maybe 2 more chicks, 4/21: 1c dead" +2022,6th_bridge,43,greg,2022-03-31,,2,nestling,"3/23: ~5 days old, 4/14: maybe 2 more chicks, 4/21: 1c dead" +2022,6th_bridge,43,greg,2022-04-07,,1,nestling,"3/23: ~5 days old, 4/14: maybe 2 more chicks, 4/21: 1c dead" +2022,6th_bridge,43,greg,2022-04-14,,1,branchling,"3/23: ~5 days old, 4/14: maybe 2 more chicks, 4/21: 1c dead" +2022,6th_bridge,43,greg,2022-04-21,,,empty,"3/23: ~5 days old, 4/14: maybe 2 more chicks, 4/21: 1c dead" +2022,6th_bridge,45,bcnh,2022-02-19,3,,incubating,"3/23: dead BCNH chick hanging, 4/7: smhe, 4/21: smwh, c wet" +2022,6th_bridge,45,bcnh,2022-02-24,3,,incubating,"3/23: dead BCNH chick hanging, 4/7: smhe, 4/21: smwh, c wet" +2022,6th_bridge,45,bcnh,2022-03-03,3,,incubating,"3/23: dead BCNH chick hanging, 4/7: smhe, 4/21: smwh, c wet" +2022,6th_bridge,45,bcnh,2022-03-17,,3,nestling,"3/23: dead BCNH chick hanging, 4/7: smhe, 4/21: smwh, c wet" +2022,6th_bridge,45,bcnh,2022-03-23,,,empty,"3/23: dead BCNH chick hanging, 4/7: smhe, 4/21: smwh, c wet" +2022,6th_bridge,45,bcnh,2022-03-31,2,,incubating,"3/23: dead BCNH chick hanging, 4/7: smhe, 4/21: smwh, c wet" +2022,6th_bridge,45,bcnh,2022-04-07,3,,incubating,"3/23: dead BCNH chick hanging, 4/7: smhe, 4/21: smwh, c wet" +2022,6th_bridge,45,bcnh,2022-04-14,,,missed,"3/23: dead BCNH chick hanging, 4/7: smhe, 4/21: smwh, c wet" +2022,6th_bridge,45,bcnh,2022-04-21,1,2,wet_chick,"3/23: dead BCNH chick hanging, 4/7: smhe, 4/21: smwh, c wet" +2022,6th_bridge,44,greg,2022-02-19,,,,"4/14: chicks big, ran" +2022,6th_bridge,44,greg,2022-02-24,2,,incubating,"4/14: chicks big, ran" +2022,6th_bridge,44,greg,2022-03-03,2,,incubating,"4/14: chicks big, ran" +2022,6th_bridge,44,greg,2022-03-17,,,missed,"4/14: chicks big, ran" +2022,6th_bridge,44,greg,2022-03-23,,2,nestling,"4/14: chicks big, ran" +2022,6th_bridge,44,greg,2022-03-31,,2,nestling,"4/14: chicks big, ran" +2022,6th_bridge,44,greg,2022-04-07,,,missed,"4/14: chicks big, ran" +2022,6th_bridge,44,greg,2022-04-14,,2,branchling,"4/14: chicks big, ran" +2022,6th_bridge,44,greg,2022-04-21,,,empty,"4/14: chicks big, ran" +2022,6th_bridge,46,greg,2022-02-19,,,,"4/14: chicks running, 4/21: 1c ran" +2022,6th_bridge,46,greg,2022-02-24,3,,incubating,"4/14: chicks running, 4/21: 1c ran" +2022,6th_bridge,46,greg,2022-03-03,3,,incubating,"4/14: chicks running, 4/21: 1c ran" +2022,6th_bridge,46,greg,2022-03-17,,,missed,"4/14: chicks running, 4/21: 1c ran" +2022,6th_bridge,46,greg,2022-03-23,,2,nestling,"4/14: chicks running, 4/21: 1c ran" +2022,6th_bridge,46,greg,2022-03-31,,2,nestling,"4/14: chicks running, 4/21: 1c ran" +2022,6th_bridge,46,greg,2022-04-07,,2,nestling,"4/14: chicks running, 4/21: 1c ran" +2022,6th_bridge,46,greg,2022-04-14,,2,branchling,"4/14: chicks running, 4/21: 1c ran" +2022,6th_bridge,46,greg,2022-04-21,,,empty,"4/14: chicks running, 4/21: 1c ran" +2022,6th_bridge,184,greg,2022-02-19,,,,"3/23: ~1 week old, 4/21: 1c+" +2022,6th_bridge,184,greg,2022-02-24,2,,incubating,"3/23: ~1 week old, 4/21: 1c+" +2022,6th_bridge,184,greg,2022-03-03,2,,incubating,"3/23: ~1 week old, 4/21: 1c+" +2022,6th_bridge,184,greg,2022-03-17,,,missed,"3/23: ~1 week old, 4/21: 1c+" +2022,6th_bridge,184,greg,2022-03-23,,2,nestling,"3/23: ~1 week old, 4/21: 1c+" +2022,6th_bridge,184,greg,2022-03-31,,2,nestling,"3/23: ~1 week old, 4/21: 1c+" +2022,6th_bridge,184,greg,2022-04-07,,2,nestling,"3/23: ~1 week old, 4/21: 1c+" +2022,6th_bridge,184,greg,2022-04-14,,2,nestling,"3/23: ~1 week old, 4/21: 1c+" +2022,6th_bridge,184,greg,2022-04-21,,1,branchling,"3/23: ~1 week old, 4/21: 1c+" +2022,6th_bridge,186,greg,2022-02-19,,,,"Behind flag. 3/23: youngest <1 week old, 4/14: gone" +2022,6th_bridge,186,greg,2022-02-24,3,,incubating,"Behind flag. 3/23: youngest <1 week old, 4/14: gone" +2022,6th_bridge,186,greg,2022-03-03,3,,incubating,"Behind flag. 3/23: youngest <1 week old, 4/14: gone" +2022,6th_bridge,186,greg,2022-03-17,,,missed,"Behind flag. 3/23: youngest <1 week old, 4/14: gone" +2022,6th_bridge,186,greg,2022-03-23,,3,nestling,"Behind flag. 3/23: youngest <1 week old, 4/14: gone" +2022,6th_bridge,186,greg,2022-03-31,,,empty,"Behind flag. 3/23: youngest <1 week old, 4/14: gone" +2022,6th_bridge,186,greg,2022-04-07,,,missed,"Behind flag. 3/23: youngest <1 week old, 4/14: gone" +2022,6th_bridge,186,greg,2022-04-14,,,,"Behind flag. 3/23: youngest <1 week old, 4/14: gone" +2022,6th_bridge,186,greg,2022-04-21,,,,"Behind flag. 3/23: youngest <1 week old, 4/14: gone" +2022,6th_bridge,48,greg,2022-02-19,,,,"To the right of trail just before hitting intersection the second time, after 43. 3/23: one dead chick (not specified if included in count or not), 4/14: nest gone but 1C" +2022,6th_bridge,48,greg,2022-02-24,3,,incubating,"To the right of trail just before hitting intersection the second time, after 43. 3/23: one dead chick (not specified if included in count or not), 4/14: nest gone but 1C" +2022,6th_bridge,48,greg,2022-03-03,3,,incubating,"To the right of trail just before hitting intersection the second time, after 43. 3/23: one dead chick (not specified if included in count or not), 4/14: nest gone but 1C" +2022,6th_bridge,48,greg,2022-03-17,,,missed,"To the right of trail just before hitting intersection the second time, after 43. 3/23: one dead chick (not specified if included in count or not), 4/14: nest gone but 1C" +2022,6th_bridge,48,greg,2022-03-23,,2,nestling,"To the right of trail just before hitting intersection the second time, after 43. 3/23: one dead chick (not specified if included in count or not), 4/14: nest gone but 1C" +2022,6th_bridge,48,greg,2022-03-31,,2,nestling,"To the right of trail just before hitting intersection the second time, after 43. 3/23: one dead chick (not specified if included in count or not), 4/14: nest gone but 1C" +2022,6th_bridge,48,greg,2022-04-07,,1,nestling,"To the right of trail just before hitting intersection the second time, after 43. 3/23: one dead chick (not specified if included in count or not), 4/14: nest gone but 1C" +2022,6th_bridge,48,greg,2022-04-14,,1,nestling,"To the right of trail just before hitting intersection the second time, after 43. 3/23: one dead chick (not specified if included in count or not), 4/14: nest gone but 1C" +2022,6th_bridge,48,greg,2022-04-21,,,empty,"To the right of trail just before hitting intersection the second time, after 43. 3/23: one dead chick (not specified if included in count or not), 4/14: nest gone but 1C" +2022,6th_bridge,50,rosp,2022-02-19,,,,"To the left of trail on exit, east of 31. 3/23: large chick" +2022,6th_bridge,50,rosp,2022-02-24,3,,incubating,"To the left of trail on exit, east of 31. 3/23: large chick" +2022,6th_bridge,50,rosp,2022-03-03,3,,incubating,"To the left of trail on exit, east of 31. 3/23: large chick" +2022,6th_bridge,50,rosp,2022-03-17,,,missed,"To the left of trail on exit, east of 31. 3/23: large chick" +2022,6th_bridge,50,rosp,2022-03-23,1,1,hatching,"To the left of trail on exit, east of 31. 3/23: large chick" +2022,6th_bridge,50,rosp,2022-03-31,,1,nestling,"To the left of trail on exit, east of 31. 3/23: large chick" +2022,6th_bridge,50,rosp,2022-04-07,,1,nestling,"To the left of trail on exit, east of 31. 3/23: large chick" +2022,6th_bridge,50,rosp,2022-04-14,,,empty,"To the left of trail on exit, east of 31. 3/23: large chick" +2022,6th_bridge,50,rosp,2022-04-21,,,empty,"To the left of trail on exit, east of 31. 3/23: large chick" +2022,6th_bridge,52,greg,2022-02-19,,,,"To the left of trail on exit, by 50. 3/23: chick dry, 4/7: third chick dead" +2022,6th_bridge,52,greg,2022-02-24,1,,incubating,"To the left of trail on exit, by 50. 3/23: chick dry, 4/7: third chick dead" +2022,6th_bridge,52,greg,2022-03-03,3,,incubating,"To the left of trail on exit, by 50. 3/23: chick dry, 4/7: third chick dead" +2022,6th_bridge,52,greg,2022-03-17,,,missed,"To the left of trail on exit, by 50. 3/23: chick dry, 4/7: third chick dead" +2022,6th_bridge,52,greg,2022-03-23,2,1,hatching,"To the left of trail on exit, by 50. 3/23: chick dry, 4/7: third chick dead" +2022,6th_bridge,52,greg,2022-03-31,,3,nestling,"To the left of trail on exit, by 50. 3/23: chick dry, 4/7: third chick dead" +2022,6th_bridge,52,greg,2022-04-07,,2,nestling,"To the left of trail on exit, by 50. 3/23: chick dry, 4/7: third chick dead" +2022,6th_bridge,52,greg,2022-04-14,,,empty,"To the left of trail on exit, by 50. 3/23: chick dry, 4/7: third chick dead" +2022,6th_bridge,52,greg,2022-04-21,,1,nestling,"To the left of trail on exit, by 50. 3/23: chick dry, 4/7: third chick dead" +2022,6th_bridge,54,rosp,2022-02-19,,,,"4/14: on canopy" +2022,6th_bridge,54,rosp,2022-02-24,3,,incubating,"4/14: on canopy" +2022,6th_bridge,54,rosp,2022-03-03,3,,incubating,"4/14: on canopy" +2022,6th_bridge,54,rosp,2022-03-17,,,missed,"4/14: on canopy" +2022,6th_bridge,54,rosp,2022-03-23,,2,nestling,"4/14: on canopy" +2022,6th_bridge,54,rosp,2022-03-31,,2,nestling,"4/14: on canopy" +2022,6th_bridge,54,rosp,2022-04-07,,2,nestling,"4/14: on canopy" +2022,6th_bridge,54,rosp,2022-04-14,,2,branchling,"4/14: on canopy" +2022,6th_bridge,54,rosp,2022-04-21,,,empty,"4/14: on canopy" +2022,6th_bridge,188,bcnh,2022-02-19,,,,"BCNH species has question mark next to it. 3/3: accidentally recorded as #118 prior to 3/3, 3/23: re-laying ROSP, 3/31: whib?, 4/14: chick dry, confirmed rosp" +2022,6th_bridge,188,bcnh,2022-02-24,3,,incubating,"BCNH species has question mark next to it. 3/3: accidentally recorded as #118 prior to 3/3, 3/23: re-laying ROSP, 3/31: whib?, 4/14: chick dry, confirmed rosp" +2022,6th_bridge,188,bcnh,2022-03-03,,,empty,"BCNH species has question mark next to it. 3/3: accidentally recorded as #118 prior to 3/3, 3/23: re-laying ROSP, 3/31: whib?, 4/14: chick dry, confirmed rosp" +2022,6th_bridge,188,bcnh,2022-03-17,,,missed,"BCNH species has question mark next to it. 3/3: accidentally recorded as #118 prior to 3/3, 3/23: re-laying ROSP, 3/31: whib?, 4/14: chick dry, confirmed rosp" +2022,6th_bridge,188,bcnh,2022-03-23,1,,incubating,"BCNH species has question mark next to it. 3/3: accidentally recorded as #118 prior to 3/3, 3/23: re-laying ROSP, 3/31: whib?, 4/14: chick dry, confirmed rosp" +2022,6th_bridge,188,bcnh,2022-03-31,2,,incubating,"BCNH species has question mark next to it. 3/3: accidentally recorded as #118 prior to 3/3, 3/23: re-laying ROSP, 3/31: whib?, 4/14: chick dry, confirmed rosp" +2022,6th_bridge,188,bcnh,2022-04-07,3,,incubating,"BCNH species has question mark next to it. 3/3: accidentally recorded as #118 prior to 3/3, 3/23: re-laying ROSP, 3/31: whib?, 4/14: chick dry, confirmed rosp" +2022,6th_bridge,188,bcnh,2022-04-14,2,1,chick_dry,"BCNH species has question mark next to it. 3/3: accidentally recorded as #118 prior to 3/3, 3/23: re-laying ROSP, 3/31: whib?, 4/14: chick dry, confirmed rosp" +2022,6th_bridge,188,bcnh,2022-04-21,,3,nestling,"BCNH species has question mark next to it. 3/3: accidentally recorded as #118 prior to 3/3, 3/23: re-laying ROSP, 3/31: whib?, 4/14: chick dry, confirmed rosp" +2022,6th_bridge,92,bcnh,2022-02-19,,,, +2022,6th_bridge,92,bcnh,2022-02-24,,,, +2022,6th_bridge,92,bcnh,2022-03-03,3,,incubating, +2022,6th_bridge,92,bcnh,2022-03-17,,,missed, +2022,6th_bridge,92,bcnh,2022-03-23,,,empty, +2022,6th_bridge,92,bcnh,2022-03-31,,,missed, +2022,6th_bridge,92,bcnh,2022-04-07,,,missed, +2022,6th_bridge,92,bcnh,2022-04-14,,,missed, +2022,6th_bridge,92,bcnh,2022-04-21,,,, +2022,6th_bridge,273,bcnh,2022-02-19,,,,"4/21: 3c smwh???" +2022,6th_bridge,273,bcnh,2022-02-24,,,,"4/21: 3c smwh???" +2022,6th_bridge,273,bcnh,2022-03-03,,,,"4/21: 3c smwh???" +2022,6th_bridge,273,bcnh,2022-03-17,1,,incubating,"4/21: 3c smwh???" +2022,6th_bridge,273,bcnh,2022-03-23,3,,incubating,"4/21: 3c smwh???" +2022,6th_bridge,273,bcnh,2022-03-31,,,missed,"4/21: 3c smwh???" +2022,6th_bridge,273,bcnh,2022-04-07,,,empty,"4/21: 3c smwh???" +2022,6th_bridge,273,bcnh,2022-04-14,,,missed,"4/21: 3c smwh???" +2022,6th_bridge,273,bcnh,2022-04-21,,3,nestling,"4/21: 3c smwh???" +2022,6th_bridge,4,smwh,2022-02-19,,,,"This is nest 04, different than 4 which is also in this colony. 4/14: smwh" +2022,6th_bridge,4,smwh,2022-02-24,,,,"This is nest 04, different than 4 which is also in this colony. 4/14: smwh" +2022,6th_bridge,4,smwh,2022-03-03,,,,"This is nest 04, different than 4 which is also in this colony. 4/14: smwh" +2022,6th_bridge,4,smwh,2022-03-17,1,,incubating,"This is nest 04, different than 4 which is also in this colony. 4/14: smwh" +2022,6th_bridge,4,smwh,2022-03-23,3,,incubating,"This is nest 04, different than 4 which is also in this colony. 4/14: smwh" +2022,6th_bridge,4,smwh,2022-03-31,3,,incubating,"This is nest 04, different than 4 which is also in this colony. 4/14: smwh" +2022,6th_bridge,4,smwh,2022-04-07,2,,incubating,"This is nest 04, different than 4 which is also in this colony. 4/14: smwh" +2022,6th_bridge,4,smwh,2022-04-14,,2,nestling,"This is nest 04, different than 4 which is also in this colony. 4/14: smwh" +2022,6th_bridge,4,smwh,2022-04-21,,2,nestling,"This is nest 04, different than 4 which is also in this colony. 4/14: smwh" +2022,6th_bridge,332,whib,2022-02-19,,,,"4/14: chicks dry" +2022,6th_bridge,332,whib,2022-02-24,,,,"4/14: chicks dry" +2022,6th_bridge,332,whib,2022-03-03,,,,"4/14: chicks dry" +2022,6th_bridge,332,whib,2022-03-17,,,,"4/14: chicks dry" +2022,6th_bridge,332,whib,2022-03-23,2,,incubating,"4/14: chicks dry" +2022,6th_bridge,332,whib,2022-03-31,2,,incubating,"4/14: chicks dry" +2022,6th_bridge,332,whib,2022-04-07,2,,incubating,"4/14: chicks dry" +2022,6th_bridge,332,whib,2022-04-14,,2,nestling,"4/14: chicks dry" +2022,6th_bridge,332,whib,2022-04-21,,1,nestling,"4/14: chicks dry" +2022,6th_bridge,276,whib,2022-02-19,,,,"4/14: eggs pipping, chick dry" +2022,6th_bridge,276,whib,2022-02-24,,,,"4/14: eggs pipping, chick dry" +2022,6th_bridge,276,whib,2022-03-03,,,,"4/14: eggs pipping, chick dry" +2022,6th_bridge,276,whib,2022-03-17,,,,"4/14: eggs pipping, chick dry" +2022,6th_bridge,276,whib,2022-03-23,2,,incubating,"4/14: eggs pipping, chick dry" +2022,6th_bridge,276,whib,2022-03-31,3,,incubating,"4/14: eggs pipping, chick dry" +2022,6th_bridge,276,whib,2022-04-07,3,,incubating,"4/14: eggs pipping, chick dry" +2022,6th_bridge,276,whib,2022-04-14,2,1,pipping,"4/14: eggs pipping, chick dry" +2022,6th_bridge,276,whib,2022-04-21,,3,nestling,"4/14: eggs pipping, chick dry" +2022,6th_bridge,278,whib,2022-02-19,,,,"4/14: chick dry" +2022,6th_bridge,278,whib,2022-02-24,,,,"4/14: chick dry" +2022,6th_bridge,278,whib,2022-03-03,,,,"4/14: chick dry" +2022,6th_bridge,278,whib,2022-03-17,,,,"4/14: chick dry" +2022,6th_bridge,278,whib,2022-03-23,2,,incubating,"4/14: chick dry" +2022,6th_bridge,278,whib,2022-03-31,2,,incubating,"4/14: chick dry" +2022,6th_bridge,278,whib,2022-04-07,2,,incubating,"4/14: chick dry" +2022,6th_bridge,278,whib,2022-04-14,,2,chick_dry,"4/14: chick dry" +2022,6th_bridge,278,whib,2022-04-21,,1,nestling,"4/14: chick dry" +2022,6th_bridge,334,whib,2022-02-19,,,,"4/14: chick dry" +2022,6th_bridge,334,whib,2022-02-24,,,,"4/14: chick dry" +2022,6th_bridge,334,whib,2022-03-03,,,,"4/14: chick dry" +2022,6th_bridge,334,whib,2022-03-17,,,,"4/14: chick dry" +2022,6th_bridge,334,whib,2022-03-23,2,,incubating,"4/14: chick dry" +2022,6th_bridge,334,whib,2022-03-31,2,,incubating,"4/14: chick dry" +2022,6th_bridge,334,whib,2022-04-07,2,,incubating,"4/14: chick dry" +2022,6th_bridge,334,whib,2022-04-14,,2,chick_dry,"4/14: chick dry" +2022,6th_bridge,334,whib,2022-04-21,,1,nestling,"4/14: chick dry" +2022,6th_bridge,336,smwh,2022-02-19,,,,"4/14: smwh" +2022,6th_bridge,336,smwh,2022-02-24,,,,"4/14: smwh" +2022,6th_bridge,336,smwh,2022-03-03,,,,"4/14: smwh" +2022,6th_bridge,336,smwh,2022-03-17,,,,"4/14: smwh" +2022,6th_bridge,336,smwh,2022-03-23,3,,incubating,"4/14: smwh" +2022,6th_bridge,336,smwh,2022-03-31,3,,incubating,"4/14: smwh" +2022,6th_bridge,336,smwh,2022-04-07,3,,incubating,"4/14: smwh" +2022,6th_bridge,336,smwh,2022-04-14,,3,nestling,"4/14: smwh" +2022,6th_bridge,336,smwh,2022-04-21,,3,nestling,"4/14: smwh" +2022,6th_bridge,280,smwh,2022-02-19,,,,"4/14: smwh, 1 wet chick" +2022,6th_bridge,280,smwh,2022-02-24,,,,"4/14: smwh, 1 wet chick" +2022,6th_bridge,280,smwh,2022-03-03,,,,"4/14: smwh, 1 wet chick" +2022,6th_bridge,280,smwh,2022-03-17,,,,"4/14: smwh, 1 wet chick" +2022,6th_bridge,280,smwh,2022-03-23,2,,incubating,"4/14: smwh, 1 wet chick" +2022,6th_bridge,280,smwh,2022-03-31,4,,incubating,"4/14: smwh, 1 wet chick" +2022,6th_bridge,280,smwh,2022-04-07,4,,incubating,"4/14: smwh, 1 wet chick" +2022,6th_bridge,280,smwh,2022-04-14,2,2,wet_chick,"4/14: smwh, 1 wet chick" +2022,6th_bridge,280,smwh,2022-04-21,,3,nestling,"4/14: smwh, 1 wet chick" +2022,6th_bridge,282,smwh,2022-02-19,,,,"4/14: smwh, 1 dry chick" +2022,6th_bridge,282,smwh,2022-02-24,,,,"4/14: smwh, 1 dry chick" +2022,6th_bridge,282,smwh,2022-03-03,,,,"4/14: smwh, 1 dry chick" +2022,6th_bridge,282,smwh,2022-03-17,,,,"4/14: smwh, 1 dry chick" +2022,6th_bridge,282,smwh,2022-03-23,3,,incubating,"4/14: smwh, 1 dry chick" +2022,6th_bridge,282,smwh,2022-03-31,3,,incubating,"4/14: smwh, 1 dry chick" +2022,6th_bridge,282,smwh,2022-04-07,3,,incubating,"4/14: smwh, 1 dry chick" +2022,6th_bridge,282,smwh,2022-04-14,,3,chick_dry,"4/14: smwh, 1 dry chick" +2022,6th_bridge,282,smwh,2022-04-21,,3,nestling,"4/14: smwh, 1 dry chick" +2022,6th_bridge,211,whib,2022-02-19,,,, +2022,6th_bridge,211,whib,2022-02-24,,,, +2022,6th_bridge,211,whib,2022-03-03,,,, +2022,6th_bridge,211,whib,2022-03-17,,,, +2022,6th_bridge,211,whib,2022-03-23,2,,incubating, +2022,6th_bridge,211,whib,2022-03-31,2,,incubating, +2022,6th_bridge,211,whib,2022-04-07,2,,incubating, +2022,6th_bridge,211,whib,2022-04-14,,1,nestling, +2022,6th_bridge,211,whib,2022-04-21,,1,nestling, +2022,6th_bridge,213,whib,2022-02-19,,,, +2022,6th_bridge,213,whib,2022-02-24,,,, +2022,6th_bridge,213,whib,2022-03-03,,,, +2022,6th_bridge,213,whib,2022-03-17,,,, +2022,6th_bridge,213,whib,2022-03-23,2,,incubating, +2022,6th_bridge,213,whib,2022-03-31,2,,incubating, +2022,6th_bridge,213,whib,2022-04-07,2,,incubating, +2022,6th_bridge,213,whib,2022-04-14,,2,nestling, +2022,6th_bridge,213,whib,2022-04-21,,2,nestling, +2022,6th_bridge,215,whib,2022-02-19,,,, +2022,6th_bridge,215,whib,2022-02-24,,,, +2022,6th_bridge,215,whib,2022-03-03,,,, +2022,6th_bridge,215,whib,2022-03-17,,,, +2022,6th_bridge,215,whib,2022-03-23,2,,incubating, +2022,6th_bridge,215,whib,2022-03-31,2,,incubating, +2022,6th_bridge,215,whib,2022-04-07,2,,incubating, +2022,6th_bridge,215,whib,2022-04-14,,1,nestling, +2022,6th_bridge,215,whib,2022-04-21,,1,nestling, +2022,6th_bridge,338,whib,2022-02-19,,,, +2022,6th_bridge,338,whib,2022-02-24,,,, +2022,6th_bridge,338,whib,2022-03-03,,,, +2022,6th_bridge,338,whib,2022-03-17,,,, +2022,6th_bridge,338,whib,2022-03-23,2,,incubating, +2022,6th_bridge,338,whib,2022-03-31,2,,incubating, +2022,6th_bridge,338,whib,2022-04-07,2,,incubating, +2022,6th_bridge,338,whib,2022-04-14,,2,nestling, +2022,6th_bridge,338,whib,2022-04-21,,1,nestling, +2022,6th_bridge,340,whib,2022-02-19,,,,"4/14: chick dry" +2022,6th_bridge,340,whib,2022-02-24,,,,"4/14: chick dry" +2022,6th_bridge,340,whib,2022-03-03,,,,"4/14: chick dry" +2022,6th_bridge,340,whib,2022-03-17,,,,"4/14: chick dry" +2022,6th_bridge,340,whib,2022-03-23,2,,incubating,"4/14: chick dry" +2022,6th_bridge,340,whib,2022-03-31,3,,incubating,"4/14: chick dry" +2022,6th_bridge,340,whib,2022-04-07,3,,incubating,"4/14: chick dry" +2022,6th_bridge,340,whib,2022-04-14,,3,chick_dry,"4/14: chick dry" +2022,6th_bridge,340,whib,2022-04-21,,,missed,"4/14: chick dry" +2022,6th_bridge,461,smwh,2022-02-19,,,,"4/21: smwh, dry" +2022,6th_bridge,461,smwh,2022-02-24,,,,"4/21: smwh, dry" +2022,6th_bridge,461,smwh,2022-03-03,,,,"4/21: smwh, dry" +2022,6th_bridge,461,smwh,2022-03-17,,,,"4/21: smwh, dry" +2022,6th_bridge,461,smwh,2022-03-23,,,,"4/21: smwh, dry" +2022,6th_bridge,461,smwh,2022-03-31,3,,incubating,"4/21: smwh, dry" +2022,6th_bridge,461,smwh,2022-04-07,3,,incubating,"4/21: smwh, dry" +2022,6th_bridge,461,smwh,2022-04-14,,,missed,"4/21: smwh, dry" +2022,6th_bridge,461,smwh,2022-04-21,,3,nestling,"4/21: smwh, dry" +2022,6th_bridge,284,whib,2022-02-19,,,,"4/14: chicks dry, 4/21: +1 dead" +2022,6th_bridge,284,whib,2022-02-24,,,,"4/14: chicks dry, 4/21: +1 dead" +2022,6th_bridge,284,whib,2022-03-03,,,,"4/14: chicks dry, 4/21: +1 dead" +2022,6th_bridge,284,whib,2022-03-17,,,,"4/14: chicks dry, 4/21: +1 dead" +2022,6th_bridge,284,whib,2022-03-23,2,,incubating,"4/14: chicks dry, 4/21: +1 dead" +2022,6th_bridge,284,whib,2022-03-31,2,,incubating,"4/14: chicks dry, 4/21: +1 dead" +2022,6th_bridge,284,whib,2022-04-07,3,,incubating,"4/14: chicks dry, 4/21: +1 dead" +2022,6th_bridge,284,whib,2022-04-14,1,2,hatching,"4/14: chicks dry, 4/21: +1 dead" +2022,6th_bridge,284,whib,2022-04-21,,1,nestling,"4/14: chicks dry, 4/21: +1 dead" +2022,6th_bridge,344,whib,2022-02-19,,,, +2022,6th_bridge,344,whib,2022-02-24,,,, +2022,6th_bridge,344,whib,2022-03-03,,,, +2022,6th_bridge,344,whib,2022-03-17,,,, +2022,6th_bridge,344,whib,2022-03-23,3,,incubating, +2022,6th_bridge,344,whib,2022-03-31,2,,incubating, +2022,6th_bridge,344,whib,2022-04-07,2,,incubating, +2022,6th_bridge,344,whib,2022-04-14,2,1,hatching, +2022,6th_bridge,344,whib,2022-04-21,2,1,hatching, +2022,6th_bridge,342,whib,2022-02-19,,,,"4/14: gone, 4/21: gone" +2022,6th_bridge,342,whib,2022-02-24,,,,"4/14: gone, 4/21: gone" +2022,6th_bridge,342,whib,2022-03-03,,,,"4/14: gone, 4/21: gone" +2022,6th_bridge,342,whib,2022-03-17,,,,"4/14: gone, 4/21: gone" +2022,6th_bridge,342,whib,2022-03-23,2,,incubating,"4/14: gone, 4/21: gone" +2022,6th_bridge,342,whib,2022-03-31,1,,incubating,"4/14: gone, 4/21: gone" +2022,6th_bridge,342,whib,2022-04-07,,,empty,"4/14: gone, 4/21: gone" +2022,6th_bridge,342,whib,2022-04-14,,,,"4/14: gone, 4/21: gone" +2022,6th_bridge,342,whib,2022-04-21,,,,"4/14: gone, 4/21: gone" +2022,6th_bridge,217,smwh,2022-02-19,,,,"4/7: smwh, 4/21: 1 smwh 1c" +2022,6th_bridge,217,smwh,2022-02-24,,,,"4/7: smwh, 4/21: 1 smwh 1c" +2022,6th_bridge,217,smwh,2022-03-03,,,,"4/7: smwh, 4/21: 1 smwh 1c" +2022,6th_bridge,217,smwh,2022-03-17,,,,"4/7: smwh, 4/21: 1 smwh 1c" +2022,6th_bridge,217,smwh,2022-03-23,3,,incubating,"4/7: smwh, 4/21: 1 smwh 1c" +2022,6th_bridge,217,smwh,2022-03-31,4,,incubating,"4/7: smwh, 4/21: 1 smwh 1c" +2022,6th_bridge,217,smwh,2022-04-07,2,2,hatching,"4/7: smwh, 4/21: 1 smwh 1c" +2022,6th_bridge,217,smwh,2022-04-14,,3,nestling,"4/7: smwh, 4/21: 1 smwh 1c" +2022,6th_bridge,217,smwh,2022-04-21,,1,nestling,"4/7: smwh, 4/21: 1 smwh 1c" +2022,6th_bridge,219,whib,2022-02-19,,,, +2022,6th_bridge,219,whib,2022-02-24,,,, +2022,6th_bridge,219,whib,2022-03-03,,,, +2022,6th_bridge,219,whib,2022-03-17,,,, +2022,6th_bridge,219,whib,2022-03-23,2,,incubating, +2022,6th_bridge,219,whib,2022-03-31,2,,incubating, +2022,6th_bridge,219,whib,2022-04-07,2,,incubating, +2022,6th_bridge,219,whib,2022-04-14,1,1,hatching, +2022,6th_bridge,219,whib,2022-04-21,,,empty, +2022,6th_bridge,286,whib,2022-02-19,,,, +2022,6th_bridge,286,whib,2022-02-24,,,, +2022,6th_bridge,286,whib,2022-03-03,,,, +2022,6th_bridge,286,whib,2022-03-17,,,, +2022,6th_bridge,286,whib,2022-03-23,2,,incubating, +2022,6th_bridge,286,whib,2022-03-31,2,,incubating, +2022,6th_bridge,286,whib,2022-04-07,,,missed, +2022,6th_bridge,286,whib,2022-04-14,,2,nestling, +2022,6th_bridge,286,whib,2022-04-21,,,empty, +2022,6th_bridge,288,whib,2022-02-19,,,,"4/14: dry chicks" +2022,6th_bridge,288,whib,2022-02-24,,,,"4/14: dry chicks" +2022,6th_bridge,288,whib,2022-03-03,,,,"4/14: dry chicks" +2022,6th_bridge,288,whib,2022-03-17,,,,"4/14: dry chicks" +2022,6th_bridge,288,whib,2022-03-23,2,,incubating,"4/14: dry chicks" +2022,6th_bridge,288,whib,2022-03-31,2,,incubating,"4/14: dry chicks" +2022,6th_bridge,288,whib,2022-04-07,3,,incubating,"4/14: dry chicks" +2022,6th_bridge,288,whib,2022-04-14,,2,chick_dry,"4/14: dry chicks" +2022,6th_bridge,288,whib,2022-04-21,,1,nestling,"4/14: dry chicks" +2022,6th_bridge,221,smwh,2022-02-19,,,,"BCNH has question mark next to it. 4/7: smhe, 4/14: smwh, chick wet, 1 pipping, 4/21: smwh" +2022,6th_bridge,221,smwh,2022-02-24,,,,"BCNH has question mark next to it. 4/7: smhe, 4/14: smwh, chick wet, 1 pipping, 4/21: smwh" +2022,6th_bridge,221,smwh,2022-03-03,,,,"BCNH has question mark next to it. 4/7: smhe, 4/14: smwh, chick wet, 1 pipping, 4/21: smwh" +2022,6th_bridge,221,smwh,2022-03-17,,,,"BCNH has question mark next to it. 4/7: smhe, 4/14: smwh, chick wet, 1 pipping, 4/21: smwh" +2022,6th_bridge,221,smwh,2022-03-23,3,,incubating,"BCNH has question mark next to it. 4/7: smhe, 4/14: smwh, chick wet, 1 pipping, 4/21: smwh" +2022,6th_bridge,221,smwh,2022-03-31,4,,incubating,"BCNH has question mark next to it. 4/7: smhe, 4/14: smwh, chick wet, 1 pipping, 4/21: smwh" +2022,6th_bridge,221,smwh,2022-04-07,4,,incubating,"BCNH has question mark next to it. 4/7: smhe, 4/14: smwh, chick wet, 1 pipping, 4/21: smwh" +2022,6th_bridge,221,smwh,2022-04-14,2,2,wet_chick,"BCNH has question mark next to it. 4/7: smhe, 4/14: smwh, chick wet, 1 pipping, 4/21: smwh" +2022,6th_bridge,221,smwh,2022-04-21,,4,nestling,"BCNH has question mark next to it. 4/7: smhe, 4/14: smwh, chick wet, 1 pipping, 4/21: smwh" +2022,6th_bridge,348,whib,2022-02-19,,,, +2022,6th_bridge,348,whib,2022-02-24,,,, +2022,6th_bridge,348,whib,2022-03-03,,,, +2022,6th_bridge,348,whib,2022-03-17,,,, +2022,6th_bridge,348,whib,2022-03-23,2,,incubating, +2022,6th_bridge,348,whib,2022-03-31,2,,incubating, +2022,6th_bridge,348,whib,2022-04-07,2,,incubating, +2022,6th_bridge,348,whib,2022-04-14,,2,nestling, +2022,6th_bridge,348,whib,2022-04-21,,1,nestling, +2022,6th_bridge,346,whib,2022-02-19,,,, +2022,6th_bridge,346,whib,2022-02-24,,,, +2022,6th_bridge,346,whib,2022-03-03,,,, +2022,6th_bridge,346,whib,2022-03-17,,,, +2022,6th_bridge,346,whib,2022-03-23,2,,incubating, +2022,6th_bridge,346,whib,2022-03-31,2,,incubating, +2022,6th_bridge,346,whib,2022-04-07,2,,incubating, +2022,6th_bridge,346,whib,2022-04-14,2,,incubating, +2022,6th_bridge,346,whib,2022-04-21,2,,incubating, +2022,6th_bridge,350,whib,2022-02-19,,,,"4/7: gone" +2022,6th_bridge,350,whib,2022-02-24,,,,"4/7: gone" +2022,6th_bridge,350,whib,2022-03-03,,,,"4/7: gone" +2022,6th_bridge,350,whib,2022-03-17,,,,"4/7: gone" +2022,6th_bridge,350,whib,2022-03-23,2,,incubating,"4/7: gone" +2022,6th_bridge,350,whib,2022-03-31,1,,incubating,"4/7: gone" +2022,6th_bridge,350,whib,2022-04-07,,,empty,"4/7: gone" +2022,6th_bridge,350,whib,2022-04-14,,,,"4/7: gone" +2022,6th_bridge,350,whib,2022-04-21,,,,"4/7: gone" +2022,6th_bridge,465,smhe,2022-02-19,,,,"4/14: hatching" +2022,6th_bridge,465,smhe,2022-02-24,,,,"4/14: hatching" +2022,6th_bridge,465,smhe,2022-03-03,,,,"4/14: hatching" +2022,6th_bridge,465,smhe,2022-03-17,,,,"4/14: hatching" +2022,6th_bridge,465,smhe,2022-03-23,,,,"4/14: hatching" +2022,6th_bridge,465,smhe,2022-03-31,3,,incubating,"4/14: hatching" +2022,6th_bridge,465,smhe,2022-04-07,3,,incubating,"4/14: hatching" +2022,6th_bridge,465,smhe,2022-04-14,2,1,wet_chick,"4/14: hatching" +2022,6th_bridge,465,smhe,2022-04-21,2,,incubating,"4/14: hatching" +2022,6th_bridge,290,smhe,2022-02-19,,,,"4/7: gone" +2022,6th_bridge,290,smhe,2022-02-24,,,,"4/7: gone" +2022,6th_bridge,290,smhe,2022-03-03,,,,"4/7: gone" +2022,6th_bridge,290,smhe,2022-03-17,,,,"4/7: gone" +2022,6th_bridge,290,smhe,2022-03-23,2,,incubating,"4/7: gone" +2022,6th_bridge,290,smhe,2022-03-31,,,empty,"4/7: gone" +2022,6th_bridge,290,smhe,2022-04-07,,,,"4/7: gone" +2022,6th_bridge,290,smhe,2022-04-14,,,,"4/7: gone" +2022,6th_bridge,290,smhe,2022-04-21,,,,"4/7: gone" +2022,6th_bridge,352,whib,2022-02-19,,,,"4/21: +1 dead under" +2022,6th_bridge,352,whib,2022-02-24,,,,"4/21: +1 dead under" +2022,6th_bridge,352,whib,2022-03-03,,,,"4/21: +1 dead under" +2022,6th_bridge,352,whib,2022-03-17,,,,"4/21: +1 dead under" +2022,6th_bridge,352,whib,2022-03-23,2,,incubating,"4/21: +1 dead under" +2022,6th_bridge,352,whib,2022-03-31,2,,incubating,"4/21: +1 dead under" +2022,6th_bridge,352,whib,2022-04-07,2,,incubating,"4/21: +1 dead under" +2022,6th_bridge,352,whib,2022-04-14,,2,nestling,"4/21: +1 dead under" +2022,6th_bridge,352,whib,2022-04-21,,1,nestling,"4/21: +1 dead under" +2022,6th_bridge,354,trhe,2022-02-19,,,,"4/21: trhe" +2022,6th_bridge,354,trhe,2022-02-24,,,,"4/21: trhe" +2022,6th_bridge,354,trhe,2022-03-03,,,,"4/21: trhe" +2022,6th_bridge,354,trhe,2022-03-17,,,,"4/21: trhe" +2022,6th_bridge,354,trhe,2022-03-23,1,,incubating,"4/21: trhe" +2022,6th_bridge,354,trhe,2022-03-31,3,,incubating,"4/21: trhe" +2022,6th_bridge,354,trhe,2022-04-07,3,,incubating,"4/21: trhe" +2022,6th_bridge,354,trhe,2022-04-14,3,,incubating,"4/21: trhe" +2022,6th_bridge,354,trhe,2022-04-21,,3,chick_dry,"4/21: trhe" +2022,6th_bridge,292,smwh,2022-02-19,,,,"4/21: smwh" +2022,6th_bridge,292,smwh,2022-02-24,,,,"4/21: smwh" +2022,6th_bridge,292,smwh,2022-03-03,,,,"4/21: smwh" +2022,6th_bridge,292,smwh,2022-03-17,,,,"4/21: smwh" +2022,6th_bridge,292,smwh,2022-03-23,2,,incubating,"4/21: smwh" +2022,6th_bridge,292,smwh,2022-03-31,3,,incubating,"4/21: smwh" +2022,6th_bridge,292,smwh,2022-04-07,4,,incubating,"4/21: smwh" +2022,6th_bridge,292,smwh,2022-04-14,,,missed,"4/21: smwh" +2022,6th_bridge,292,smwh,2022-04-21,2,2,hatching,"4/21: smwh" +2022,6th_bridge,223,smwh,2022-02-19,,,,"4/14: smwh" +2022,6th_bridge,223,smwh,2022-02-24,,,,"4/14: smwh" +2022,6th_bridge,223,smwh,2022-03-03,,,,"4/14: smwh" +2022,6th_bridge,223,smwh,2022-03-17,,,,"4/14: smwh" +2022,6th_bridge,223,smwh,2022-03-23,3,,incubating,"4/14: smwh" +2022,6th_bridge,223,smwh,2022-03-31,3,,incubating,"4/14: smwh" +2022,6th_bridge,223,smwh,2022-04-07,3,,incubating,"4/14: smwh" +2022,6th_bridge,223,smwh,2022-04-14,,3,nestling,"4/14: smwh" +2022,6th_bridge,223,smwh,2022-04-21,,3,nestling,"4/14: smwh" +2022,6th_bridge,225,smhe,2022-02-19,,,, +2022,6th_bridge,225,smhe,2022-02-24,,,, +2022,6th_bridge,225,smhe,2022-03-03,,,, +2022,6th_bridge,225,smhe,2022-03-17,,,, +2022,6th_bridge,225,smhe,2022-03-23,2,,incubating, +2022,6th_bridge,225,smhe,2022-03-31,1,,incubating, +2022,6th_bridge,225,smhe,2022-04-07,3,,incubating, +2022,6th_bridge,225,smhe,2022-04-14,3,,incubating, +2022,6th_bridge,225,smhe,2022-04-21,3,,incubating, +2022,6th_bridge,294,whib,2022-02-19,,,,"4/14: gone, 4/21: gone" +2022,6th_bridge,294,whib,2022-02-24,,,,"4/14: gone, 4/21: gone" +2022,6th_bridge,294,whib,2022-03-03,,,,"4/14: gone, 4/21: gone" +2022,6th_bridge,294,whib,2022-03-17,,,,"4/14: gone, 4/21: gone" +2022,6th_bridge,294,whib,2022-03-23,2,,incubating,"4/14: gone, 4/21: gone" +2022,6th_bridge,294,whib,2022-03-31,,,empty,"4/14: gone, 4/21: gone" +2022,6th_bridge,294,whib,2022-04-07,,,empty,"4/14: gone, 4/21: gone" +2022,6th_bridge,294,whib,2022-04-14,,,,"4/14: gone, 4/21: gone" +2022,6th_bridge,294,whib,2022-04-21,,,,"4/14: gone, 4/21: gone" +2022,6th_bridge,296,whib,2022-02-19,,,, +2022,6th_bridge,296,whib,2022-02-24,,,, +2022,6th_bridge,296,whib,2022-03-03,,,, +2022,6th_bridge,296,whib,2022-03-17,,,, +2022,6th_bridge,296,whib,2022-03-23,2,,incubating, +2022,6th_bridge,296,whib,2022-03-31,2,,incubating, +2022,6th_bridge,296,whib,2022-04-07,2,,incubating, +2022,6th_bridge,296,whib,2022-04-14,,2,nestling, +2022,6th_bridge,296,whib,2022-04-21,,2,nestling, +2022,6th_bridge,227,smwh,2022-02-19,,,,"4/14: smwh, dry chicks" +2022,6th_bridge,227,smwh,2022-02-24,,,,"4/14: smwh, dry chicks" +2022,6th_bridge,227,smwh,2022-03-03,,,,"4/14: smwh, dry chicks" +2022,6th_bridge,227,smwh,2022-03-17,,,,"4/14: smwh, dry chicks" +2022,6th_bridge,227,smwh,2022-03-23,3,,incubating,"4/14: smwh, dry chicks" +2022,6th_bridge,227,smwh,2022-03-31,3,,incubating,"4/14: smwh, dry chicks" +2022,6th_bridge,227,smwh,2022-04-07,3,,incubating,"4/14: smwh, dry chicks" +2022,6th_bridge,227,smwh,2022-04-14,,3,chick_dry,"4/14: smwh, dry chicks" +2022,6th_bridge,227,smwh,2022-04-21,,,empty,"4/14: smwh, dry chicks" +2022,6th_bridge,356,smwh,2022-02-19,,,,"4/14: 1 egg pipping, 4/21: smwh" +2022,6th_bridge,356,smwh,2022-02-24,,,,"4/14: 1 egg pipping, 4/21: smwh" +2022,6th_bridge,356,smwh,2022-03-03,,,,"4/14: 1 egg pipping, 4/21: smwh" +2022,6th_bridge,356,smwh,2022-03-17,,,,"4/14: 1 egg pipping, 4/21: smwh" +2022,6th_bridge,356,smwh,2022-03-23,1,,incubating,"4/14: 1 egg pipping, 4/21: smwh" +2022,6th_bridge,356,smwh,2022-03-31,3,,incubating,"4/14: 1 egg pipping, 4/21: smwh" +2022,6th_bridge,356,smwh,2022-04-07,3,,incubating,"4/14: 1 egg pipping, 4/21: smwh" +2022,6th_bridge,356,smwh,2022-04-14,3,,pipping,"4/14: 1 egg pipping, 4/21: smwh" +2022,6th_bridge,356,smwh,2022-04-21,,3,nestling,"4/14: 1 egg pipping, 4/21: smwh" +2022,6th_bridge,298,trhe,2022-02-19,,,,"4/14: pipping, trhe" +2022,6th_bridge,298,trhe,2022-02-24,,,,"4/14: pipping, trhe" +2022,6th_bridge,298,trhe,2022-03-03,,,,"4/14: pipping, trhe" +2022,6th_bridge,298,trhe,2022-03-17,,,,"4/14: pipping, trhe" +2022,6th_bridge,298,trhe,2022-03-23,3,,incubating,"4/14: pipping, trhe" +2022,6th_bridge,298,trhe,2022-03-31,3,,incubating,"4/14: pipping, trhe" +2022,6th_bridge,298,trhe,2022-04-07,3,,incubating,"4/14: pipping, trhe" +2022,6th_bridge,298,trhe,2022-04-14,1,2,pipping,"4/14: pipping, trhe" +2022,6th_bridge,298,trhe,2022-04-21,,3,nestling,"4/14: pipping, trhe" +2022,6th_bridge,391,glib,2022-02-19,,,,"4/21: certain 3c" +2022,6th_bridge,391,glib,2022-02-24,,,,"4/21: certain 3c" +2022,6th_bridge,391,glib,2022-03-03,,,,"4/21: certain 3c" +2022,6th_bridge,391,glib,2022-03-17,,,,"4/21: certain 3c" +2022,6th_bridge,391,glib,2022-03-23,,,,"4/21: certain 3c" +2022,6th_bridge,391,glib,2022-03-31,3,,incubating,"4/21: certain 3c" +2022,6th_bridge,391,glib,2022-04-07,3,,incubating,"4/21: certain 3c" +2022,6th_bridge,391,glib,2022-04-14,2,,incubating,"4/21: certain 3c" +2022,6th_bridge,391,glib,2022-04-21,,3,nestling,"4/21: certain 3c" +2022,6th_bridge,358,sneg,2022-02-19,,,,"4/14: smwh, one wet chick, 4/21: snowie, adult nearby" +2022,6th_bridge,358,sneg,2022-02-24,,,,"4/14: smwh, one wet chick, 4/21: snowie, adult nearby" +2022,6th_bridge,358,sneg,2022-03-03,,,,"4/14: smwh, one wet chick, 4/21: snowie, adult nearby" +2022,6th_bridge,358,sneg,2022-03-17,,,,"4/14: smwh, one wet chick, 4/21: snowie, adult nearby" +2022,6th_bridge,358,sneg,2022-03-23,3,,incubating,"4/14: smwh, one wet chick, 4/21: snowie, adult nearby" +2022,6th_bridge,358,sneg,2022-03-31,3,,incubating,"4/14: smwh, one wet chick, 4/21: snowie, adult nearby" +2022,6th_bridge,358,sneg,2022-04-07,3,,incubating,"4/14: smwh, one wet chick, 4/21: snowie, adult nearby" +2022,6th_bridge,358,sneg,2022-04-14,,3,wet_chick,"4/14: smwh, one wet chick, 4/21: snowie, adult nearby" +2022,6th_bridge,358,sneg,2022-04-21,,3,nestling,"4/14: smwh, one wet chick, 4/21: snowie, adult nearby" +2022,6th_bridge,229,whib,2022-02-19,,,,"4/14: dry chicks" +2022,6th_bridge,229,whib,2022-02-24,,,,"4/14: dry chicks" +2022,6th_bridge,229,whib,2022-03-03,,,,"4/14: dry chicks" +2022,6th_bridge,229,whib,2022-03-17,,,,"4/14: dry chicks" +2022,6th_bridge,229,whib,2022-03-23,2,,incubating,"4/14: dry chicks" +2022,6th_bridge,229,whib,2022-03-31,2,,incubating,"4/14: dry chicks" +2022,6th_bridge,229,whib,2022-04-07,2,,incubating,"4/14: dry chicks" +2022,6th_bridge,229,whib,2022-04-14,,2,chick_dry,"4/14: dry chicks" +2022,6th_bridge,229,whib,2022-04-21,,2,nestling,"4/14: dry chicks" +2022,6th_bridge,231,whib,2022-02-19,,,,"4/14: gone, 4/21: gone" +2022,6th_bridge,231,whib,2022-02-24,,,,"4/14: gone, 4/21: gone" +2022,6th_bridge,231,whib,2022-03-03,,,,"4/14: gone, 4/21: gone" +2022,6th_bridge,231,whib,2022-03-17,,,,"4/14: gone, 4/21: gone" +2022,6th_bridge,231,whib,2022-03-23,2,,incubating,"4/14: gone, 4/21: gone" +2022,6th_bridge,231,whib,2022-03-31,3,,incubating,"4/14: gone, 4/21: gone" +2022,6th_bridge,231,whib,2022-04-07,3,,incubating,"4/14: gone, 4/21: gone" +2022,6th_bridge,231,whib,2022-04-14,,,empty,"4/14: gone, 4/21: gone" +2022,6th_bridge,231,whib,2022-04-21,,,,"4/14: gone, 4/21: gone" +2022,6th_bridge,233,smhe,2022-02-19,,,,"4/14: chick dead, 4/21: dead chick" +2022,6th_bridge,233,smhe,2022-02-24,,,,"4/14: chick dead, 4/21: dead chick" +2022,6th_bridge,233,smhe,2022-03-03,,,,"4/14: chick dead, 4/21: dead chick" +2022,6th_bridge,233,smhe,2022-03-17,,,,"4/14: chick dead, 4/21: dead chick" +2022,6th_bridge,233,smhe,2022-03-23,2,,incubating,"4/14: chick dead, 4/21: dead chick" +2022,6th_bridge,233,smhe,2022-03-31,2,,incubating,"4/14: chick dead, 4/21: dead chick" +2022,6th_bridge,233,smhe,2022-04-07,2,,incubating,"4/14: chick dead, 4/21: dead chick" +2022,6th_bridge,233,smhe,2022-04-14,,,empty,"4/14: chick dead, 4/21: dead chick" +2022,6th_bridge,233,smhe,2022-04-21,,,empty,"4/14: chick dead, 4/21: dead chick" +2022,6th_bridge,360,whib,2022-02-19,,,, +2022,6th_bridge,360,whib,2022-02-24,,,, +2022,6th_bridge,360,whib,2022-03-03,,,, +2022,6th_bridge,360,whib,2022-03-17,,,, +2022,6th_bridge,360,whib,2022-03-23,3,,incubating, +2022,6th_bridge,360,whib,2022-03-31,3,,incubating, +2022,6th_bridge,360,whib,2022-04-07,3,,incubating, +2022,6th_bridge,360,whib,2022-04-14,,3,nestling, +2022,6th_bridge,360,whib,2022-04-21,,1,nestling, +2022,6th_bridge,467,smhe,2022-02-19,,,, +2022,6th_bridge,467,smhe,2022-02-24,,,, +2022,6th_bridge,467,smhe,2022-03-03,,,, +2022,6th_bridge,467,smhe,2022-03-17,,,, +2022,6th_bridge,467,smhe,2022-03-23,,,, +2022,6th_bridge,467,smhe,2022-03-31,3,,incubating, +2022,6th_bridge,467,smhe,2022-04-07,3,,incubating, +2022,6th_bridge,467,smhe,2022-04-14,,,missed, +2022,6th_bridge,467,smhe,2022-04-21,1,3,hatching, +2022,6th_bridge,300,trhe,2022-02-19,,,,"4/14: trhe" +2022,6th_bridge,300,trhe,2022-02-24,,,,"4/14: trhe" +2022,6th_bridge,300,trhe,2022-03-03,,,,"4/14: trhe" +2022,6th_bridge,300,trhe,2022-03-17,,,,"4/14: trhe" +2022,6th_bridge,300,trhe,2022-03-23,2,,incubating,"4/14: trhe" +2022,6th_bridge,300,trhe,2022-03-31,3,,incubating,"4/14: trhe" +2022,6th_bridge,300,trhe,2022-04-07,3,,incubating,"4/14: trhe" +2022,6th_bridge,300,trhe,2022-04-14,1,2,hatching,"4/14: trhe" +2022,6th_bridge,300,trhe,2022-04-21,,3,nestling,"4/14: trhe" +2022,6th_bridge,302,smwh,2022-02-19,,,,"4/7: smwh" +2022,6th_bridge,302,smwh,2022-02-24,,,,"4/7: smwh" +2022,6th_bridge,302,smwh,2022-03-03,,,,"4/7: smwh" +2022,6th_bridge,302,smwh,2022-03-17,,,,"4/7: smwh" +2022,6th_bridge,302,smwh,2022-03-23,4,,incubating,"4/7: smwh" +2022,6th_bridge,302,smwh,2022-03-31,4,,incubating,"4/7: smwh" +2022,6th_bridge,302,smwh,2022-04-07,2,2,hatching,"4/7: smwh" +2022,6th_bridge,302,smwh,2022-04-14,,4,nestling,"4/7: smwh" +2022,6th_bridge,302,smwh,2022-04-21,,3,nestling,"4/7: smwh" +2022,6th_bridge,323,smhe,2022-02-19,,,,"4/14: one dry chick, 1 pipping" +2022,6th_bridge,323,smhe,2022-02-24,,,,"4/14: one dry chick, 1 pipping" +2022,6th_bridge,323,smhe,2022-03-03,,,,"4/14: one dry chick, 1 pipping" +2022,6th_bridge,323,smhe,2022-03-17,,,,"4/14: one dry chick, 1 pipping" +2022,6th_bridge,323,smhe,2022-03-23,2,,incubating,"4/14: one dry chick, 1 pipping" +2022,6th_bridge,323,smhe,2022-03-31,4,,incubating,"4/14: one dry chick, 1 pipping" +2022,6th_bridge,323,smhe,2022-04-07,4,,incubating,"4/14: one dry chick, 1 pipping" +2022,6th_bridge,323,smhe,2022-04-14,3,1,pipping,"4/14: one dry chick, 1 pipping" +2022,6th_bridge,323,smhe,2022-04-21,,4,nestling,"4/14: one dry chick, 1 pipping" +2022,6th_bridge,362,glib,2022-02-19,,,,"4/14: pipping, 4/21: runt" +2022,6th_bridge,362,glib,2022-02-24,,,,"4/14: pipping, 4/21: runt" +2022,6th_bridge,362,glib,2022-03-03,,,,"4/14: pipping, 4/21: runt" +2022,6th_bridge,362,glib,2022-03-17,,,,"4/14: pipping, 4/21: runt" +2022,6th_bridge,362,glib,2022-03-23,1,,incubating,"4/14: pipping, 4/21: runt" +2022,6th_bridge,362,glib,2022-03-31,3,,incubating,"4/14: pipping, 4/21: runt" +2022,6th_bridge,362,glib,2022-04-07,3,,incubating,"4/14: pipping, 4/21: runt" +2022,6th_bridge,362,glib,2022-04-14,1,2,pipping,"4/14: pipping, 4/21: runt" +2022,6th_bridge,362,glib,2022-04-21,,3,nestling,"4/14: pipping, 4/21: runt" +2022,6th_bridge,304,smhe,2022-02-19,,,,"3/31: glib relay?" +2022,6th_bridge,304,smhe,2022-02-24,,,,"3/31: glib relay?" +2022,6th_bridge,304,smhe,2022-03-03,,,,"3/31: glib relay?" +2022,6th_bridge,304,smhe,2022-03-17,,,,"3/31: glib relay?" +2022,6th_bridge,304,smhe,2022-03-23,4,,incubating,"3/31: glib relay?" +2022,6th_bridge,304,smhe,2022-03-31,1,,incubating,"3/31: glib relay?" +2022,6th_bridge,304,smhe,2022-04-07,3,,incubating,"3/31: glib relay?" +2022,6th_bridge,304,smhe,2022-04-14,3,,incubating,"3/31: glib relay?" +2022,6th_bridge,304,smhe,2022-04-21,1,2,hatching,"3/31: glib relay?" +2022,6th_bridge,306,whib,2022-02-19,,,,"4/14: pipping" +2022,6th_bridge,306,whib,2022-02-24,,,,"4/14: pipping" +2022,6th_bridge,306,whib,2022-03-03,,,,"4/14: pipping" +2022,6th_bridge,306,whib,2022-03-17,,,,"4/14: pipping" +2022,6th_bridge,306,whib,2022-03-23,1,,incubating,"4/14: pipping" +2022,6th_bridge,306,whib,2022-03-31,2,,incubating,"4/14: pipping" +2022,6th_bridge,306,whib,2022-04-07,2,,incubating,"4/14: pipping" +2022,6th_bridge,306,whib,2022-04-14,1,1,pipping,"4/14: pipping" +2022,6th_bridge,306,whib,2022-04-21,,2,nestling,"4/14: pipping" +2022,6th_bridge,325,whib,2022-02-19,,,,"4/21: gone" +2022,6th_bridge,325,whib,2022-02-24,,,,"4/21: gone" +2022,6th_bridge,325,whib,2022-03-03,,,,"4/21: gone" +2022,6th_bridge,325,whib,2022-03-17,,,,"4/21: gone" +2022,6th_bridge,325,whib,2022-03-23,2,,incubating,"4/21: gone" +2022,6th_bridge,325,whib,2022-03-31,2,,incubating,"4/21: gone" +2022,6th_bridge,325,whib,2022-04-07,2,,incubating,"4/21: gone" +2022,6th_bridge,325,whib,2022-04-14,,,missed,"4/21: gone" +2022,6th_bridge,325,whib,2022-04-21,,,empty,"4/21: gone" +2022,6th_bridge,364,whib,2022-02-19,,,, +2022,6th_bridge,364,whib,2022-02-24,,,, +2022,6th_bridge,364,whib,2022-03-03,,,, +2022,6th_bridge,364,whib,2022-03-17,,,, +2022,6th_bridge,364,whib,2022-03-23,2,,incubating, +2022,6th_bridge,364,whib,2022-03-31,2,,incubating, +2022,6th_bridge,364,whib,2022-04-07,2,,incubating, +2022,6th_bridge,364,whib,2022-04-14,,2,nestling, +2022,6th_bridge,364,whib,2022-04-21,,1,nestling, +2022,6th_bridge,393,glib,2022-02-19,,,,"4/21: dry" +2022,6th_bridge,393,glib,2022-02-24,,,,"4/21: dry" +2022,6th_bridge,393,glib,2022-03-03,,,,"4/21: dry" +2022,6th_bridge,393,glib,2022-03-17,,,,"4/21: dry" +2022,6th_bridge,393,glib,2022-03-23,,,,"4/21: dry" +2022,6th_bridge,393,glib,2022-03-31,3,,incubating,"4/21: dry" +2022,6th_bridge,393,glib,2022-04-07,3,,incubating,"4/21: dry" +2022,6th_bridge,393,glib,2022-04-14,,,missed,"4/21: dry" +2022,6th_bridge,393,glib,2022-04-21,,2,chick_dry,"4/21: dry" +2022,6th_bridge,372,smwh,2022-02-19,,,,"4/14: one wet chick, smwh, 4/21: smwh" +2022,6th_bridge,372,smwh,2022-02-24,,,,"4/14: one wet chick, smwh, 4/21: smwh" +2022,6th_bridge,372,smwh,2022-03-03,,,,"4/14: one wet chick, smwh, 4/21: smwh" +2022,6th_bridge,372,smwh,2022-03-17,,,,"4/14: one wet chick, smwh, 4/21: smwh" +2022,6th_bridge,372,smwh,2022-03-23,4,,incubating,"4/14: one wet chick, smwh, 4/21: smwh" +2022,6th_bridge,372,smwh,2022-03-31,4,,incubating,"4/14: one wet chick, smwh, 4/21: smwh" +2022,6th_bridge,372,smwh,2022-04-07,3,,incubating,"4/14: one wet chick, smwh, 4/21: smwh" +2022,6th_bridge,372,smwh,2022-04-14,,3,wet_chick,"4/14: one wet chick, smwh, 4/21: smwh" +2022,6th_bridge,372,smwh,2022-04-21,,3,nestling,"4/14: one wet chick, smwh, 4/21: smwh" +2022,6th_bridge,368,whib,2022-02-19,,,, +2022,6th_bridge,368,whib,2022-02-24,,,, +2022,6th_bridge,368,whib,2022-03-03,,,, +2022,6th_bridge,368,whib,2022-03-17,,,, +2022,6th_bridge,368,whib,2022-03-23,1,,incubating, +2022,6th_bridge,368,whib,2022-03-31,2,,incubating, +2022,6th_bridge,368,whib,2022-04-07,2,,incubating, +2022,6th_bridge,368,whib,2022-04-14,1,1,hatching, +2022,6th_bridge,368,whib,2022-04-21,,,empty, +2022,6th_bridge,370,whib,2022-02-19,,,,"4/14: cracked eggs, 4/21: 1 egg cracked" +2022,6th_bridge,370,whib,2022-02-24,,,,"4/14: cracked eggs, 4/21: 1 egg cracked" +2022,6th_bridge,370,whib,2022-03-03,,,,"4/14: cracked eggs, 4/21: 1 egg cracked" +2022,6th_bridge,370,whib,2022-03-17,,,,"4/14: cracked eggs, 4/21: 1 egg cracked" +2022,6th_bridge,370,whib,2022-03-23,2,,incubating,"4/14: cracked eggs, 4/21: 1 egg cracked" +2022,6th_bridge,370,whib,2022-03-31,3,,incubating,"4/14: cracked eggs, 4/21: 1 egg cracked" +2022,6th_bridge,370,whib,2022-04-07,3,,incubating,"4/14: cracked eggs, 4/21: 1 egg cracked" +2022,6th_bridge,370,whib,2022-04-14,,,empty,"4/14: cracked eggs, 4/21: 1 egg cracked" +2022,6th_bridge,370,whib,2022-04-21,2,,incubating,"4/14: cracked eggs, 4/21: 1 egg cracked" +2022,6th_bridge,366,whib,2022-02-19,,,,"4/14: one dead chick as well" +2022,6th_bridge,366,whib,2022-02-24,,,,"4/14: one dead chick as well" +2022,6th_bridge,366,whib,2022-03-03,,,,"4/14: one dead chick as well" +2022,6th_bridge,366,whib,2022-03-17,,,,"4/14: one dead chick as well" +2022,6th_bridge,366,whib,2022-03-23,2,,incubating,"4/14: one dead chick as well" +2022,6th_bridge,366,whib,2022-03-31,2,,incubating,"4/14: one dead chick as well" +2022,6th_bridge,366,whib,2022-04-07,2,,incubating,"4/14: one dead chick as well" +2022,6th_bridge,366,whib,2022-04-14,,1,nestling,"4/14: one dead chick as well" +2022,6th_bridge,366,whib,2022-04-21,,,empty,"4/14: one dead chick as well" +2022,6th_bridge,395,smwh,2022-02-19,,,,"4/14: smwh, 4/21: smwh, dry" +2022,6th_bridge,395,smwh,2022-02-24,,,,"4/14: smwh, 4/21: smwh, dry" +2022,6th_bridge,395,smwh,2022-03-03,,,,"4/14: smwh, 4/21: smwh, dry" +2022,6th_bridge,395,smwh,2022-03-17,,,,"4/14: smwh, 4/21: smwh, dry" +2022,6th_bridge,395,smwh,2022-03-23,,,,"4/14: smwh, 4/21: smwh, dry" +2022,6th_bridge,395,smwh,2022-03-31,3,,incubating,"4/14: smwh, 4/21: smwh, dry" +2022,6th_bridge,395,smwh,2022-04-07,,,missed,"4/14: smwh, 4/21: smwh, dry" +2022,6th_bridge,395,smwh,2022-04-14,3,,incubating,"4/14: smwh, 4/21: smwh, dry" +2022,6th_bridge,395,smwh,2022-04-21,,3,chick_dry,"4/14: smwh, 4/21: smwh, dry" +2022,6th_bridge,329,whib,2022-02-19,,,, +2022,6th_bridge,329,whib,2022-02-24,,,, +2022,6th_bridge,329,whib,2022-03-03,,,, +2022,6th_bridge,329,whib,2022-03-17,,,, +2022,6th_bridge,329,whib,2022-03-23,1,,incubating, +2022,6th_bridge,329,whib,2022-03-31,,,empty, +2022,6th_bridge,329,whib,2022-04-07,,,empty, +2022,6th_bridge,329,whib,2022-04-14,,,empty, +2022,6th_bridge,329,whib,2022-04-21,,,empty, +2022,6th_bridge,327,whib,2022-02-19,,,, +2022,6th_bridge,327,whib,2022-02-24,,,, +2022,6th_bridge,327,whib,2022-03-03,,,, +2022,6th_bridge,327,whib,2022-03-17,,,, +2022,6th_bridge,327,whib,2022-03-23,2,,incubating, +2022,6th_bridge,327,whib,2022-03-31,2,,incubating, +2022,6th_bridge,327,whib,2022-04-07,2,,incubating, +2022,6th_bridge,327,whib,2022-04-14,2,,incubating, +2022,6th_bridge,327,whib,2022-04-21,,2,nestling, +2022,6th_bridge,335,whib,2022-02-19,,,,"3/31: gone, 4/21: gone" +2022,6th_bridge,335,whib,2022-02-24,,,,"3/31: gone, 4/21: gone" +2022,6th_bridge,335,whib,2022-03-03,,,,"3/31: gone, 4/21: gone" +2022,6th_bridge,335,whib,2022-03-17,,,,"3/31: gone, 4/21: gone" +2022,6th_bridge,335,whib,2022-03-23,2,,incubating,"3/31: gone, 4/21: gone" +2022,6th_bridge,335,whib,2022-03-31,,,empty,"3/31: gone, 4/21: gone" +2022,6th_bridge,335,whib,2022-04-07,,,,"3/31: gone, 4/21: gone" +2022,6th_bridge,335,whib,2022-04-14,,,,"3/31: gone, 4/21: gone" +2022,6th_bridge,335,whib,2022-04-21,,,,"3/31: gone, 4/21: gone" +2022,6th_bridge,374,smhe,2022-02-19,,,,"4/14: dry chick, 1 pipping" +2022,6th_bridge,374,smhe,2022-02-24,,,,"4/14: dry chick, 1 pipping" +2022,6th_bridge,374,smhe,2022-03-03,,,,"4/14: dry chick, 1 pipping" +2022,6th_bridge,374,smhe,2022-03-17,,,,"4/14: dry chick, 1 pipping" +2022,6th_bridge,374,smhe,2022-03-23,2,,incubating,"4/14: dry chick, 1 pipping" +2022,6th_bridge,374,smhe,2022-03-31,4,,incubating,"4/14: dry chick, 1 pipping" +2022,6th_bridge,374,smhe,2022-04-07,4,,incubating,"4/14: dry chick, 1 pipping" +2022,6th_bridge,374,smhe,2022-04-14,3,1,pipping,"4/14: dry chick, 1 pipping" +2022,6th_bridge,374,smhe,2022-04-21,,4,nestling,"4/14: dry chick, 1 pipping" +2022,6th_bridge,376,whib,2022-02-19,,,,"3/31: gone, 4/21: gone" +2022,6th_bridge,376,whib,2022-02-24,,,,"3/31: gone, 4/21: gone" +2022,6th_bridge,376,whib,2022-03-03,,,,"3/31: gone, 4/21: gone" +2022,6th_bridge,376,whib,2022-03-17,,,,"3/31: gone, 4/21: gone" +2022,6th_bridge,376,whib,2022-03-23,1,,incubating,"3/31: gone, 4/21: gone" +2022,6th_bridge,376,whib,2022-03-31,,,empty,"3/31: gone, 4/21: gone" +2022,6th_bridge,376,whib,2022-04-07,,,,"3/31: gone, 4/21: gone" +2022,6th_bridge,376,whib,2022-04-14,,,,"3/31: gone, 4/21: gone" +2022,6th_bridge,376,whib,2022-04-21,,,,"3/31: gone, 4/21: gone" +2022,6th_bridge,378,whib,2022-02-19,,,,"4/7: one egg pipping" +2022,6th_bridge,378,whib,2022-02-24,,,,"4/7: one egg pipping" +2022,6th_bridge,378,whib,2022-03-03,,,,"4/7: one egg pipping" +2022,6th_bridge,378,whib,2022-03-17,,,,"4/7: one egg pipping" +2022,6th_bridge,378,whib,2022-03-23,2,,incubating,"4/7: one egg pipping" +2022,6th_bridge,378,whib,2022-03-31,2,,incubating,"4/7: one egg pipping" +2022,6th_bridge,378,whib,2022-04-07,2,,pipping,"4/7: one egg pipping" +2022,6th_bridge,378,whib,2022-04-14,,2,nestling,"4/7: one egg pipping" +2022,6th_bridge,378,whib,2022-04-21,,,empty,"4/7: one egg pipping" +2022,6th_bridge,469,glib,2022-02-19,,,, +2022,6th_bridge,469,glib,2022-02-24,,,, +2022,6th_bridge,469,glib,2022-03-03,,,, +2022,6th_bridge,469,glib,2022-03-17,,,, +2022,6th_bridge,469,glib,2022-03-23,,,, +2022,6th_bridge,469,glib,2022-03-31,3,,incubating, +2022,6th_bridge,469,glib,2022-04-07,3,,incubating, +2022,6th_bridge,469,glib,2022-04-14,3,,incubating, +2022,6th_bridge,469,glib,2022-04-21,1,2,hatching, +2022,6th_bridge,397,glib,2022-02-19,,,, +2022,6th_bridge,397,glib,2022-02-24,,,, +2022,6th_bridge,397,glib,2022-03-03,,,, +2022,6th_bridge,397,glib,2022-03-17,,,, +2022,6th_bridge,397,glib,2022-03-23,,,, +2022,6th_bridge,397,glib,2022-03-31,3,,incubating, +2022,6th_bridge,397,glib,2022-04-07,3,,incubating, +2022,6th_bridge,397,glib,2022-04-14,3,,incubating, +2022,6th_bridge,397,glib,2022-04-21,,,empty, +2022,6th_bridge,333,whib,2022-02-19,,,, +2022,6th_bridge,333,whib,2022-02-24,,,, +2022,6th_bridge,333,whib,2022-03-03,,,, +2022,6th_bridge,333,whib,2022-03-17,,,, +2022,6th_bridge,333,whib,2022-03-23,3,,incubating, +2022,6th_bridge,333,whib,2022-03-31,3,,incubating, +2022,6th_bridge,333,whib,2022-04-07,3,,incubating, +2022,6th_bridge,333,whib,2022-04-14,,3,nestling, +2022,6th_bridge,333,whib,2022-04-21,,2,nestling, +2022,6th_bridge,331,whib,2022-02-19,,,, +2022,6th_bridge,331,whib,2022-02-24,,,, +2022,6th_bridge,331,whib,2022-03-03,,,, +2022,6th_bridge,331,whib,2022-03-17,,,, +2022,6th_bridge,331,whib,2022-03-23,2,,incubating, +2022,6th_bridge,331,whib,2022-03-31,3,,incubating, +2022,6th_bridge,331,whib,2022-04-07,3,,incubating, +2022,6th_bridge,331,whib,2022-04-14,2,,incubating, +2022,6th_bridge,331,whib,2022-04-21,,2,nestling, +2022,6th_bridge,337,whib,2022-02-19,,,, +2022,6th_bridge,337,whib,2022-02-24,,,, +2022,6th_bridge,337,whib,2022-03-03,,,, +2022,6th_bridge,337,whib,2022-03-17,,,, +2022,6th_bridge,337,whib,2022-03-23,2,,incubating, +2022,6th_bridge,337,whib,2022-03-31,2,,incubating, +2022,6th_bridge,337,whib,2022-04-07,2,,incubating, +2022,6th_bridge,337,whib,2022-04-14,,2,nestling, +2022,6th_bridge,337,whib,2022-04-21,,,missed, +2022,6th_bridge,339,whib,2022-02-19,,,, +2022,6th_bridge,339,whib,2022-02-24,,,, +2022,6th_bridge,339,whib,2022-03-03,,,, +2022,6th_bridge,339,whib,2022-03-17,,,, +2022,6th_bridge,339,whib,2022-03-23,1,,incubating, +2022,6th_bridge,339,whib,2022-03-31,2,,incubating, +2022,6th_bridge,339,whib,2022-04-07,2,,incubating, +2022,6th_bridge,339,whib,2022-04-14,1,,incubating, +2022,6th_bridge,339,whib,2022-04-21,,,empty, +2022,6th_bridge,341,whib,2022-02-19,,,,"4/7: gone" +2022,6th_bridge,341,whib,2022-02-24,,,,"4/7: gone" +2022,6th_bridge,341,whib,2022-03-03,,,,"4/7: gone" +2022,6th_bridge,341,whib,2022-03-17,,,,"4/7: gone" +2022,6th_bridge,341,whib,2022-03-23,3,,incubating,"4/7: gone" +2022,6th_bridge,341,whib,2022-03-31,,,empty,"4/7: gone" +2022,6th_bridge,341,whib,2022-04-07,,,,"4/7: gone" +2022,6th_bridge,341,whib,2022-04-14,,,,"4/7: gone" +2022,6th_bridge,341,whib,2022-04-21,,,,"4/7: gone" +2022,6th_bridge,314,whib,2022-02-19,,,, +2022,6th_bridge,314,whib,2022-02-24,,,, +2022,6th_bridge,314,whib,2022-03-03,,,, +2022,6th_bridge,314,whib,2022-03-17,,,, +2022,6th_bridge,314,whib,2022-03-23,1,,incubating, +2022,6th_bridge,314,whib,2022-03-31,2,,incubating, +2022,6th_bridge,314,whib,2022-04-07,2,,incubating, +2022,6th_bridge,314,whib,2022-04-14,,,missed, +2022,6th_bridge,314,whib,2022-04-21,,1,nestling, +2022,6th_bridge,308,whib,2022-02-19,,,,"4/14: 2C for certain" +2022,6th_bridge,308,whib,2022-02-24,,,,"4/14: 2C for certain" +2022,6th_bridge,308,whib,2022-03-03,,,,"4/14: 2C for certain" +2022,6th_bridge,308,whib,2022-03-17,,,,"4/14: 2C for certain" +2022,6th_bridge,308,whib,2022-03-23,3,,incubating,"4/14: 2C for certain" +2022,6th_bridge,308,whib,2022-03-31,3,,incubating,"4/14: 2C for certain" +2022,6th_bridge,308,whib,2022-04-07,2,1,hatching,"4/14: 2C for certain" +2022,6th_bridge,308,whib,2022-04-14,,2,nestling,"4/14: 2C for certain" +2022,6th_bridge,308,whib,2022-04-21,,1,nestling,"4/14: 2C for certain" +2022,6th_bridge,310,rosp,2022-02-19,,,,"3/23: flagged low, 4/21: rosp" +2022,6th_bridge,310,rosp,2022-02-24,,,,"3/23: flagged low, 4/21: rosp" +2022,6th_bridge,310,rosp,2022-03-03,,,,"3/23: flagged low, 4/21: rosp" +2022,6th_bridge,310,rosp,2022-03-17,,,,"3/23: flagged low, 4/21: rosp" +2022,6th_bridge,310,rosp,2022-03-23,2,,incubating,"3/23: flagged low, 4/21: rosp" +2022,6th_bridge,310,rosp,2022-03-31,3,,incubating,"3/23: flagged low, 4/21: rosp" +2022,6th_bridge,310,rosp,2022-04-07,3,,incubating,"3/23: flagged low, 4/21: rosp" +2022,6th_bridge,310,rosp,2022-04-14,3,,incubating,"3/23: flagged low, 4/21: rosp" +2022,6th_bridge,310,rosp,2022-04-21,2,1,hatching,"3/23: flagged low, 4/21: rosp" +2022,6th_bridge,312,whib,2022-02-19,,,, +2022,6th_bridge,312,whib,2022-02-24,,,, +2022,6th_bridge,312,whib,2022-03-03,,,, +2022,6th_bridge,312,whib,2022-03-17,,,, +2022,6th_bridge,312,whib,2022-03-23,2,,incubating, +2022,6th_bridge,312,whib,2022-03-31,2,,incubating, +2022,6th_bridge,312,whib,2022-04-07,2,,incubating, +2022,6th_bridge,312,whib,2022-04-14,,1,nestling, +2022,6th_bridge,312,whib,2022-04-21,,1,nestling, +2022,6th_bridge,380,smwh,2022-02-19,,,,"4/14: smwh, dry chicks" +2022,6th_bridge,380,smwh,2022-02-24,,,,"4/14: smwh, dry chicks" +2022,6th_bridge,380,smwh,2022-03-03,,,,"4/14: smwh, dry chicks" +2022,6th_bridge,380,smwh,2022-03-17,,,,"4/14: smwh, dry chicks" +2022,6th_bridge,380,smwh,2022-03-23,2,,incubating,"4/14: smwh, dry chicks" +2022,6th_bridge,380,smwh,2022-03-31,3,,incubating,"4/14: smwh, dry chicks" +2022,6th_bridge,380,smwh,2022-04-07,3,,incubating,"4/14: smwh, dry chicks" +2022,6th_bridge,380,smwh,2022-04-14,1,2,chick_dry,"4/14: smwh, dry chicks" +2022,6th_bridge,380,smwh,2022-04-21,,3,nestling,"4/14: smwh, dry chicks" +2022,6th_bridge,382,smwh,2022-02-19,,,,"4/14: smwh" +2022,6th_bridge,382,smwh,2022-02-24,,,,"4/14: smwh" +2022,6th_bridge,382,smwh,2022-03-03,,,,"4/14: smwh" +2022,6th_bridge,382,smwh,2022-03-17,,,,"4/14: smwh" +2022,6th_bridge,382,smwh,2022-03-23,4,,incubating,"4/14: smwh" +2022,6th_bridge,382,smwh,2022-03-31,4,,incubating,"4/14: smwh" +2022,6th_bridge,382,smwh,2022-04-07,4,,incubating,"4/14: smwh" +2022,6th_bridge,382,smwh,2022-04-14,,4,nestling,"4/14: smwh" +2022,6th_bridge,382,smwh,2022-04-21,,4,nestling,"4/14: smwh" +2022,6th_bridge,343,smwh,2022-02-19,,,,"4/7: smwh, both wet" +2022,6th_bridge,343,smwh,2022-02-24,,,,"4/7: smwh, both wet" +2022,6th_bridge,343,smwh,2022-03-03,,,,"4/7: smwh, both wet" +2022,6th_bridge,343,smwh,2022-03-17,,,,"4/7: smwh, both wet" +2022,6th_bridge,343,smwh,2022-03-23,4,,incubating,"4/7: smwh, both wet" +2022,6th_bridge,343,smwh,2022-03-31,4,,incubating,"4/7: smwh, both wet" +2022,6th_bridge,343,smwh,2022-04-07,2,2,hatching,"4/7: smwh, both wet" +2022,6th_bridge,343,smwh,2022-04-14,,4,nestling,"4/7: smwh, both wet" +2022,6th_bridge,343,smwh,2022-04-21,,4,nestling,"4/7: smwh, both wet" +2022,6th_bridge,399,glib,2022-02-19,,,, +2022,6th_bridge,399,glib,2022-02-24,,,, +2022,6th_bridge,399,glib,2022-03-03,,,, +2022,6th_bridge,399,glib,2022-03-17,,,, +2022,6th_bridge,399,glib,2022-03-23,,,, +2022,6th_bridge,399,glib,2022-03-31,2,,incubating, +2022,6th_bridge,399,glib,2022-04-07,,,missed, +2022,6th_bridge,399,glib,2022-04-14,,,missed, +2022,6th_bridge,399,glib,2022-04-21,1,1,hatching, +2022,6th_bridge,471,smhe,2022-02-19,,,, +2022,6th_bridge,471,smhe,2022-02-24,,,, +2022,6th_bridge,471,smhe,2022-03-03,,,, +2022,6th_bridge,471,smhe,2022-03-17,,,, +2022,6th_bridge,471,smhe,2022-03-23,,,, +2022,6th_bridge,471,smhe,2022-03-31,1,,incubating, +2022,6th_bridge,471,smhe,2022-04-07,3,,incubating, +2022,6th_bridge,471,smhe,2022-04-14,3,,incubating, +2022,6th_bridge,471,smhe,2022-04-21,,,missed, +2022,6th_bridge,320,whib,2022-02-19,,,,"4/7: chick dry" +2022,6th_bridge,320,whib,2022-02-24,,,,"4/7: chick dry" +2022,6th_bridge,320,whib,2022-03-03,,,,"4/7: chick dry" +2022,6th_bridge,320,whib,2022-03-17,,,,"4/7: chick dry" +2022,6th_bridge,320,whib,2022-03-23,3,,incubating,"4/7: chick dry" +2022,6th_bridge,320,whib,2022-03-31,3,,incubating,"4/7: chick dry" +2022,6th_bridge,320,whib,2022-04-07,2,1,hatching,"4/7: chick dry" +2022,6th_bridge,320,whib,2022-04-14,,2,nestling,"4/7: chick dry" +2022,6th_bridge,320,whib,2022-04-21,,1,nestling,"4/7: chick dry" +2022,6th_bridge,316,whib,2022-02-19,,,,"4/7: glib relay" +2022,6th_bridge,316,whib,2022-02-24,,,,"4/7: glib relay" +2022,6th_bridge,316,whib,2022-03-03,,,,"4/7: glib relay" +2022,6th_bridge,316,whib,2022-03-17,,,,"4/7: glib relay" +2022,6th_bridge,316,whib,2022-03-23,4,,incubating,"4/7: glib relay" +2022,6th_bridge,316,whib,2022-03-31,,,empty,"4/7: glib relay" +2022,6th_bridge,316,whib,2022-04-07,2,,incubating,"4/7: glib relay" +2022,6th_bridge,316,whib,2022-04-14,3,,incubating,"4/7: glib relay" +2022,6th_bridge,316,whib,2022-04-21,3,,incubating,"4/7: glib relay" +2022,6th_bridge,318,whib,2022-02-19,,,, +2022,6th_bridge,318,whib,2022-02-24,,,, +2022,6th_bridge,318,whib,2022-03-03,,,, +2022,6th_bridge,318,whib,2022-03-17,,,, +2022,6th_bridge,318,whib,2022-03-23,1,,incubating, +2022,6th_bridge,318,whib,2022-03-31,1,,incubating, +2022,6th_bridge,318,whib,2022-04-07,1,,incubating, +2022,6th_bridge,318,whib,2022-04-14,,1,nestling, +2022,6th_bridge,318,whib,2022-04-21,,1,nestling, +2022,6th_bridge,322,trhe,2022-02-19,,,,"4/7: trhe, 4/14: 3C certain" +2022,6th_bridge,322,trhe,2022-02-24,,,,"4/7: trhe, 4/14: 3C certain" +2022,6th_bridge,322,trhe,2022-03-03,,,,"4/7: trhe, 4/14: 3C certain" +2022,6th_bridge,322,trhe,2022-03-17,,,,"4/7: trhe, 4/14: 3C certain" +2022,6th_bridge,322,trhe,2022-03-23,3,,incubating,"4/7: trhe, 4/14: 3C certain" +2022,6th_bridge,322,trhe,2022-03-31,3,,incubating,"4/7: trhe, 4/14: 3C certain" +2022,6th_bridge,322,trhe,2022-04-07,1,1,hatching,"4/7: trhe, 4/14: 3C certain" +2022,6th_bridge,322,trhe,2022-04-14,,3,nestling,"4/7: trhe, 4/14: 3C certain" +2022,6th_bridge,322,trhe,2022-04-21,,3,nestling,"4/7: trhe, 4/14: 3C certain" +2022,6th_bridge,394,whib,2022-02-19,,,,"4/7: gone, 4/21: gone" +2022,6th_bridge,394,whib,2022-02-24,,,,"4/7: gone, 4/21: gone" +2022,6th_bridge,394,whib,2022-03-03,,,,"4/7: gone, 4/21: gone" +2022,6th_bridge,394,whib,2022-03-17,,,,"4/7: gone, 4/21: gone" +2022,6th_bridge,394,whib,2022-03-23,1,,incubating,"4/7: gone, 4/21: gone" +2022,6th_bridge,394,whib,2022-03-31,1,,incubating,"4/7: gone, 4/21: gone" +2022,6th_bridge,394,whib,2022-04-07,,,empty,"4/7: gone, 4/21: gone" +2022,6th_bridge,394,whib,2022-04-14,,,,"4/7: gone, 4/21: gone" +2022,6th_bridge,394,whib,2022-04-21,,,,"4/7: gone, 4/21: gone" +2022,6th_bridge,396,greg,2022-02-19,,,,"4/14: gone?, 4/21: gone" +2022,6th_bridge,396,greg,2022-02-24,,,,"4/14: gone?, 4/21: gone" +2022,6th_bridge,396,greg,2022-03-03,,,,"4/14: gone?, 4/21: gone" +2022,6th_bridge,396,greg,2022-03-17,,,,"4/14: gone?, 4/21: gone" +2022,6th_bridge,396,greg,2022-03-23,2,,incubating,"4/14: gone?, 4/21: gone" +2022,6th_bridge,396,greg,2022-03-31,2,,incubating,"4/14: gone?, 4/21: gone" +2022,6th_bridge,396,greg,2022-04-07,2,,incubating,"4/14: gone?, 4/21: gone" +2022,6th_bridge,396,greg,2022-04-14,,,empty,"4/14: gone?, 4/21: gone" +2022,6th_bridge,396,greg,2022-04-21,,,,"4/14: gone?, 4/21: gone" +2022,6th_bridge,473,glib,2022-02-19,,,, +2022,6th_bridge,473,glib,2022-02-24,,,, +2022,6th_bridge,473,glib,2022-03-03,,,, +2022,6th_bridge,473,glib,2022-03-17,,,, +2022,6th_bridge,473,glib,2022-03-23,,,, +2022,6th_bridge,473,glib,2022-03-31,3,,incubating, +2022,6th_bridge,473,glib,2022-04-07,1,,incubating, +2022,6th_bridge,473,glib,2022-04-14,1,,incubating, +2022,6th_bridge,473,glib,2022-04-21,,1,nestling, +2022,6th_bridge,324,greg,2022-02-19,,,,"4/14: dry" +2022,6th_bridge,324,greg,2022-02-24,,,,"4/14: dry" +2022,6th_bridge,324,greg,2022-03-03,,,,"4/14: dry" +2022,6th_bridge,324,greg,2022-03-17,,,,"4/14: dry" +2022,6th_bridge,324,greg,2022-03-23,3,,incubating,"4/14: dry" +2022,6th_bridge,324,greg,2022-03-31,3,,incubating,"4/14: dry" +2022,6th_bridge,324,greg,2022-04-07,3,,incubating,"4/14: dry" +2022,6th_bridge,324,greg,2022-04-14,,3,chick_dry,"4/14: dry" +2022,6th_bridge,324,greg,2022-04-21,,3,nestling,"4/14: dry" +2022,6th_bridge,398,greg,2022-02-19,,,,"4/14: chick wet" +2022,6th_bridge,398,greg,2022-02-24,,,,"4/14: chick wet" +2022,6th_bridge,398,greg,2022-03-03,,,,"4/14: chick wet" +2022,6th_bridge,398,greg,2022-03-17,,,,"4/14: chick wet" +2022,6th_bridge,398,greg,2022-03-23,2,,incubating,"4/14: chick wet" +2022,6th_bridge,398,greg,2022-03-31,2,,incubating,"4/14: chick wet" +2022,6th_bridge,398,greg,2022-04-07,2,,incubating,"4/14: chick wet" +2022,6th_bridge,398,greg,2022-04-14,1,1,wet_chick,"4/14: chick wet" +2022,6th_bridge,398,greg,2022-04-21,,,missed,"4/14: chick wet" +2022,6th_bridge,400,smwh,2022-02-19,,,,"4/14: smwh, 1 wet" +2022,6th_bridge,400,smwh,2022-02-24,,,,"4/14: smwh, 1 wet" +2022,6th_bridge,400,smwh,2022-03-03,,,,"4/14: smwh, 1 wet" +2022,6th_bridge,400,smwh,2022-03-17,,,,"4/14: smwh, 1 wet" +2022,6th_bridge,400,smwh,2022-03-23,2,,incubating,"4/14: smwh, 1 wet" +2022,6th_bridge,400,smwh,2022-03-31,3,,incubating,"4/14: smwh, 1 wet" +2022,6th_bridge,400,smwh,2022-04-07,3,,incubating,"4/14: smwh, 1 wet" +2022,6th_bridge,400,smwh,2022-04-14,,3,wet_chick,"4/14: smwh, 1 wet" +2022,6th_bridge,400,smwh,2022-04-21,,3,nestling,"4/14: smwh, 1 wet" +2022,6th_bridge,402,greg,2022-02-19,,,,"4/7: 1 wet chick" +2022,6th_bridge,402,greg,2022-02-24,,,,"4/7: 1 wet chick" +2022,6th_bridge,402,greg,2022-03-03,,,,"4/7: 1 wet chick" +2022,6th_bridge,402,greg,2022-03-17,,,,"4/7: 1 wet chick" +2022,6th_bridge,402,greg,2022-03-23,3,,incubating,"4/7: 1 wet chick" +2022,6th_bridge,402,greg,2022-03-31,3,,incubating,"4/7: 1 wet chick" +2022,6th_bridge,402,greg,2022-04-07,1,2,wet_chick,"4/7: 1 wet chick" +2022,6th_bridge,402,greg,2022-04-14,,2,nestling,"4/7: 1 wet chick" +2022,6th_bridge,402,greg,2022-04-21,,2,nestling,"4/7: 1 wet chick" +2022,6th_bridge,401,greg,2022-02-19,,,,"4/7: gone" +2022,6th_bridge,401,greg,2022-02-24,,,,"4/7: gone" +2022,6th_bridge,401,greg,2022-03-03,,,,"4/7: gone" +2022,6th_bridge,401,greg,2022-03-17,,,,"4/7: gone" +2022,6th_bridge,401,greg,2022-03-23,,,,"4/7: gone" +2022,6th_bridge,401,greg,2022-03-31,2,,incubating,"4/7: gone" +2022,6th_bridge,401,greg,2022-04-07,,,empty,"4/7: gone" +2022,6th_bridge,401,greg,2022-04-14,,,,"4/7: gone" +2022,6th_bridge,401,greg,2022-04-21,,,,"4/7: gone" +2022,6th_bridge,326,greg,2022-02-19,,,, +2022,6th_bridge,326,greg,2022-02-24,,,, +2022,6th_bridge,326,greg,2022-03-03,,,, +2022,6th_bridge,326,greg,2022-03-17,,,, +2022,6th_bridge,326,greg,2022-03-23,3,,incubating, +2022,6th_bridge,326,greg,2022-03-31,3,,incubating, +2022,6th_bridge,326,greg,2022-04-07,3,,incubating, +2022,6th_bridge,326,greg,2022-04-14,3,,incubating, +2022,6th_bridge,326,greg,2022-04-21,,,missed, +2022,6th_bridge,384,whib,2022-02-19,,,, +2022,6th_bridge,384,whib,2022-02-24,,,, +2022,6th_bridge,384,whib,2022-03-03,,,, +2022,6th_bridge,384,whib,2022-03-17,,,, +2022,6th_bridge,384,whib,2022-03-23,2,,incubating, +2022,6th_bridge,384,whib,2022-03-31,2,,incubating, +2022,6th_bridge,384,whib,2022-04-07,2,,incubating, +2022,6th_bridge,384,whib,2022-04-14,,2,nestling, +2022,6th_bridge,384,whib,2022-04-21,,2,nestling, +2022,6th_bridge,392,whib,2022-02-19,,,,"4/14: gone, 4/21: gone" +2022,6th_bridge,392,whib,2022-02-24,,,,"4/14: gone, 4/21: gone" +2022,6th_bridge,392,whib,2022-03-03,,,,"4/14: gone, 4/21: gone" +2022,6th_bridge,392,whib,2022-03-17,,,,"4/14: gone, 4/21: gone" +2022,6th_bridge,392,whib,2022-03-23,2,,incubating,"4/14: gone, 4/21: gone" +2022,6th_bridge,392,whib,2022-03-31,2,,incubating,"4/14: gone, 4/21: gone" +2022,6th_bridge,392,whib,2022-04-07,2,,incubating,"4/14: gone, 4/21: gone" +2022,6th_bridge,392,whib,2022-04-14,,,empty,"4/14: gone, 4/21: gone" +2022,6th_bridge,392,whib,2022-04-21,,,empty,"4/14: gone, 4/21: gone" +2022,6th_bridge,390,whib,2022-02-19,,,, +2022,6th_bridge,390,whib,2022-02-24,,,, +2022,6th_bridge,390,whib,2022-03-03,,,, +2022,6th_bridge,390,whib,2022-03-17,,,, +2022,6th_bridge,390,whib,2022-03-23,2,,incubating, +2022,6th_bridge,390,whib,2022-03-31,2,,incubating, +2022,6th_bridge,390,whib,2022-04-07,2,,incubating, +2022,6th_bridge,390,whib,2022-04-14,,1,nestling, +2022,6th_bridge,390,whib,2022-04-21,,1,nestling, +2022,6th_bridge,386,whib,2022-02-19,,,, +2022,6th_bridge,386,whib,2022-02-24,,,, +2022,6th_bridge,386,whib,2022-03-03,,,, +2022,6th_bridge,386,whib,2022-03-17,,,, +2022,6th_bridge,386,whib,2022-03-23,1,,incubating, +2022,6th_bridge,386,whib,2022-03-31,1,,incubating, +2022,6th_bridge,386,whib,2022-04-07,1,,incubating, +2022,6th_bridge,386,whib,2022-04-14,,,empty, +2022,6th_bridge,386,whib,2022-04-21,,,empty, +2022,6th_bridge,388,whib,2022-02-19,,,,"4/21: glib?" +2022,6th_bridge,388,whib,2022-02-24,,,,"4/21: glib?" +2022,6th_bridge,388,whib,2022-03-03,,,,"4/21: glib?" +2022,6th_bridge,388,whib,2022-03-17,,,,"4/21: glib?" +2022,6th_bridge,388,whib,2022-03-23,2,,incubating,"4/21: glib?" +2022,6th_bridge,388,whib,2022-03-31,2,,incubating,"4/21: glib?" +2022,6th_bridge,388,whib,2022-04-07,2,,incubating,"4/21: glib?" +2022,6th_bridge,388,whib,2022-04-14,3,,incubating,"4/21: glib?" +2022,6th_bridge,388,whib,2022-04-21,3,,incubating,"4/21: glib?" +2022,6th_bridge,328,greg,2022-02-19,,,,"4/7: dry chicks" +2022,6th_bridge,328,greg,2022-02-24,,,,"4/7: dry chicks" +2022,6th_bridge,328,greg,2022-03-03,,,,"4/7: dry chicks" +2022,6th_bridge,328,greg,2022-03-17,,,,"4/7: dry chicks" +2022,6th_bridge,328,greg,2022-03-23,3,,incubating,"4/7: dry chicks" +2022,6th_bridge,328,greg,2022-03-31,3,,incubating,"4/7: dry chicks" +2022,6th_bridge,328,greg,2022-04-07,,3,chick_dry,"4/7: dry chicks" +2022,6th_bridge,328,greg,2022-04-14,,3,nestling,"4/7: dry chicks" +2022,6th_bridge,328,greg,2022-04-21,,3,nestling,"4/7: dry chicks" +2022,6th_bridge,404,smwh,2022-02-19,,,,"4/14: smwh" +2022,6th_bridge,404,smwh,2022-02-24,,,,"4/14: smwh" +2022,6th_bridge,404,smwh,2022-03-03,,,,"4/14: smwh" +2022,6th_bridge,404,smwh,2022-03-17,,,,"4/14: smwh" +2022,6th_bridge,404,smwh,2022-03-23,3,,incubating,"4/14: smwh" +2022,6th_bridge,404,smwh,2022-03-31,3,,incubating,"4/14: smwh" +2022,6th_bridge,404,smwh,2022-04-07,3,,incubating,"4/14: smwh" +2022,6th_bridge,404,smwh,2022-04-14,,3,nestling,"4/14: smwh" +2022,6th_bridge,404,smwh,2022-04-21,,3,nestling,"4/14: smwh" +2022,6th_bridge,330,greg,2022-02-19,,,,"4/14: pipping" +2022,6th_bridge,330,greg,2022-02-24,,,,"4/14: pipping" +2022,6th_bridge,330,greg,2022-03-03,,,,"4/14: pipping" +2022,6th_bridge,330,greg,2022-03-17,,,,"4/14: pipping" +2022,6th_bridge,330,greg,2022-03-23,2,,incubating,"4/14: pipping" +2022,6th_bridge,330,greg,2022-03-31,2,,incubating,"4/14: pipping" +2022,6th_bridge,330,greg,2022-04-07,2,,incubating,"4/14: pipping" +2022,6th_bridge,330,greg,2022-04-14,1,1,hatching,"4/14: pipping" +2022,6th_bridge,330,greg,2022-04-21,,1,nestling,"4/14: pipping" +2022,6th_bridge,406,trhe,2022-02-19,,,, +2022,6th_bridge,406,trhe,2022-02-24,,,, +2022,6th_bridge,406,trhe,2022-03-03,,,, +2022,6th_bridge,406,trhe,2022-03-17,,,, +2022,6th_bridge,406,trhe,2022-03-23,2,,incubating, +2022,6th_bridge,406,trhe,2022-03-31,4,,incubating, +2022,6th_bridge,406,trhe,2022-04-07,4,,incubating, +2022,6th_bridge,406,trhe,2022-04-14,4,,incubating, +2022,6th_bridge,406,trhe,2022-04-21,,4,nestling, +2022,6th_bridge,408,greg,2022-02-19,,,, +2022,6th_bridge,408,greg,2022-02-24,,,, +2022,6th_bridge,408,greg,2022-03-03,,,, +2022,6th_bridge,408,greg,2022-03-17,,,, +2022,6th_bridge,408,greg,2022-03-23,2,,incubating, +2022,6th_bridge,408,greg,2022-03-31,2,,incubating, +2022,6th_bridge,408,greg,2022-04-07,2,,incubating, +2022,6th_bridge,408,greg,2022-04-14,2,,incubating, +2022,6th_bridge,408,greg,2022-04-21,,2,nestling, +2022,6th_bridge,410,greg,2022-02-19,,,,"4/7: kind of big" +2022,6th_bridge,410,greg,2022-02-24,,,,"4/7: kind of big" +2022,6th_bridge,410,greg,2022-03-03,,,,"4/7: kind of big" +2022,6th_bridge,410,greg,2022-03-17,,,,"4/7: kind of big" +2022,6th_bridge,410,greg,2022-03-23,2,,incubating,"4/7: kind of big" +2022,6th_bridge,410,greg,2022-03-31,,,missed,"4/7: kind of big" +2022,6th_bridge,410,greg,2022-04-07,,2,nestling,"4/7: kind of big" +2022,6th_bridge,410,greg,2022-04-14,,2,nestling,"4/7: kind of big" +2022,6th_bridge,410,greg,2022-04-21,,,empty,"4/7: kind of big" +2022,6th_bridge,412,greg,2022-02-19,,,,"4/14: gone, 4/21: gone" +2022,6th_bridge,412,greg,2022-02-24,,,,"4/14: gone, 4/21: gone" +2022,6th_bridge,412,greg,2022-03-03,,,,"4/14: gone, 4/21: gone" +2022,6th_bridge,412,greg,2022-03-17,,,,"4/14: gone, 4/21: gone" +2022,6th_bridge,412,greg,2022-03-23,2,,incubating,"4/14: gone, 4/21: gone" +2022,6th_bridge,412,greg,2022-03-31,2,,incubating,"4/14: gone, 4/21: gone" +2022,6th_bridge,412,greg,2022-04-07,2,,incubating,"4/14: gone, 4/21: gone" +2022,6th_bridge,412,greg,2022-04-14,,,empty,"4/14: gone, 4/21: gone" +2022,6th_bridge,412,greg,2022-04-21,,,,"4/14: gone, 4/21: gone" +2022,6th_bridge,414,smwh,2022-02-19,,,,"4/14: smwh, one wet, pipping" +2022,6th_bridge,414,smwh,2022-02-24,,,,"4/14: smwh, one wet, pipping" +2022,6th_bridge,414,smwh,2022-03-03,,,,"4/14: smwh, one wet, pipping" +2022,6th_bridge,414,smwh,2022-03-17,,,,"4/14: smwh, one wet, pipping" +2022,6th_bridge,414,smwh,2022-03-23,2,,incubating,"4/14: smwh, one wet, pipping" +2022,6th_bridge,414,smwh,2022-03-31,3,,incubating,"4/14: smwh, one wet, pipping" +2022,6th_bridge,414,smwh,2022-04-07,3,,incubating,"4/14: smwh, one wet, pipping" +2022,6th_bridge,414,smwh,2022-04-14,1,2,wet_chick,"4/14: smwh, one wet, pipping" +2022,6th_bridge,414,smwh,2022-04-21,,3,nestling,"4/14: smwh, one wet, pipping" +2022,6th_bridge,416,whib,2022-02-19,,,, +2022,6th_bridge,416,whib,2022-02-24,,,, +2022,6th_bridge,416,whib,2022-03-03,,,, +2022,6th_bridge,416,whib,2022-03-17,,,, +2022,6th_bridge,416,whib,2022-03-23,2,,incubating, +2022,6th_bridge,416,whib,2022-03-31,2,,incubating, +2022,6th_bridge,416,whib,2022-04-07,2,,incubating, +2022,6th_bridge,416,whib,2022-04-14,,2,nestling, +2022,6th_bridge,416,whib,2022-04-21,,2,nestling, +2022,6th_bridge,418,whib,2022-02-19,,,,"4/21: look dead" +2022,6th_bridge,418,whib,2022-02-24,,,,"4/21: look dead" +2022,6th_bridge,418,whib,2022-03-03,,,,"4/21: look dead" +2022,6th_bridge,418,whib,2022-03-17,,,,"4/21: look dead" +2022,6th_bridge,418,whib,2022-03-23,1,,incubating,"4/21: look dead" +2022,6th_bridge,418,whib,2022-03-31,2,,incubating,"4/21: look dead" +2022,6th_bridge,418,whib,2022-04-07,2,,incubating,"4/21: look dead" +2022,6th_bridge,418,whib,2022-04-14,,,empty,"4/21: look dead" +2022,6th_bridge,418,whib,2022-04-21,2,,incubating,"4/21: look dead" +2022,6th_bridge,389,smhe,2022-02-19,,,,"4/21: 2 pipping" +2022,6th_bridge,389,smhe,2022-02-24,,,,"4/21: 2 pipping" +2022,6th_bridge,389,smhe,2022-03-03,,,,"4/21: 2 pipping" +2022,6th_bridge,389,smhe,2022-03-17,,,,"4/21: 2 pipping" +2022,6th_bridge,389,smhe,2022-03-23,,,,"4/21: 2 pipping" +2022,6th_bridge,389,smhe,2022-03-31,2,,incubating,"4/21: 2 pipping" +2022,6th_bridge,389,smhe,2022-04-07,4,,incubating,"4/21: 2 pipping" +2022,6th_bridge,389,smhe,2022-04-14,4,,incubating,"4/21: 2 pipping" +2022,6th_bridge,389,smhe,2022-04-21,4,,pipping,"4/21: 2 pipping" +2022,6th_bridge,459,smwh,2022-02-19,,,,"4/21: smwh" +2022,6th_bridge,459,smwh,2022-02-24,,,,"4/21: smwh" +2022,6th_bridge,459,smwh,2022-03-03,,,,"4/21: smwh" +2022,6th_bridge,459,smwh,2022-03-17,,,,"4/21: smwh" +2022,6th_bridge,459,smwh,2022-03-23,,,,"4/21: smwh" +2022,6th_bridge,459,smwh,2022-03-31,3,,incubating,"4/21: smwh" +2022,6th_bridge,459,smwh,2022-04-07,3,,incubating,"4/21: smwh" +2022,6th_bridge,459,smwh,2022-04-14,,,missed,"4/21: smwh" +2022,6th_bridge,459,smwh,2022-04-21,,3,nestling,"4/21: smwh" +2022,6th_bridge,495,trhe,2022-02-19,,,,"4/14: trhe" +2022,6th_bridge,495,trhe,2022-02-24,,,,"4/14: trhe" +2022,6th_bridge,495,trhe,2022-03-03,,,,"4/14: trhe" +2022,6th_bridge,495,trhe,2022-03-17,,,,"4/14: trhe" +2022,6th_bridge,495,trhe,2022-03-23,,,,"4/14: trhe" +2022,6th_bridge,495,trhe,2022-03-31,3,,incubating,"4/14: trhe" +2022,6th_bridge,495,trhe,2022-04-07,3,,incubating,"4/14: trhe" +2022,6th_bridge,495,trhe,2022-04-14,,3,nestling,"4/14: trhe" +2022,6th_bridge,495,trhe,2022-04-21,,3,nestling,"4/14: trhe" +2022,6th_bridge,477,smwh,2022-02-19,,,,"4/14: smwh" +2022,6th_bridge,477,smwh,2022-02-24,,,,"4/14: smwh" +2022,6th_bridge,477,smwh,2022-03-03,,,,"4/14: smwh" +2022,6th_bridge,477,smwh,2022-03-17,,,,"4/14: smwh" +2022,6th_bridge,477,smwh,2022-03-23,,,,"4/14: smwh" +2022,6th_bridge,477,smwh,2022-03-31,3,,incubating,"4/14: smwh" +2022,6th_bridge,477,smwh,2022-04-07,3,,incubating,"4/14: smwh" +2022,6th_bridge,477,smwh,2022-04-14,,3,nestling,"4/14: smwh" +2022,6th_bridge,477,smwh,2022-04-21,,3,nestling,"4/14: smwh" +2022,6th_bridge,475,whib,2022-02-19,,,, +2022,6th_bridge,475,whib,2022-02-24,,,, +2022,6th_bridge,475,whib,2022-03-03,,,, +2022,6th_bridge,475,whib,2022-03-17,,,, +2022,6th_bridge,475,whib,2022-03-23,,,, +2022,6th_bridge,475,whib,2022-03-31,2,,incubating, +2022,6th_bridge,475,whib,2022-04-07,,,empty, +2022,6th_bridge,475,whib,2022-04-14,,,empty, +2022,6th_bridge,475,whib,2022-04-21,,,empty, +2022,6th_bridge,403,smwh,2022-02-19,,,,"4/7: smwh, 1 wet chick" +2022,6th_bridge,403,smwh,2022-02-24,,,,"4/7: smwh, 1 wet chick" +2022,6th_bridge,403,smwh,2022-03-03,,,,"4/7: smwh, 1 wet chick" +2022,6th_bridge,403,smwh,2022-03-17,,,,"4/7: smwh, 1 wet chick" +2022,6th_bridge,403,smwh,2022-03-23,,,,"4/7: smwh, 1 wet chick" +2022,6th_bridge,403,smwh,2022-03-31,3,,incubating,"4/7: smwh, 1 wet chick" +2022,6th_bridge,403,smwh,2022-04-07,1,2,wet_chick,"4/7: smwh, 1 wet chick" +2022,6th_bridge,403,smwh,2022-04-14,,3,nestling,"4/7: smwh, 1 wet chick" +2022,6th_bridge,403,smwh,2022-04-21,,3,nestling,"4/7: smwh, 1 wet chick" +2022,6th_bridge,377,smhe,2022-02-19,,,, +2022,6th_bridge,377,smhe,2022-02-24,,,, +2022,6th_bridge,377,smhe,2022-03-03,,,, +2022,6th_bridge,377,smhe,2022-03-17,,,, +2022,6th_bridge,377,smhe,2022-03-23,,,, +2022,6th_bridge,377,smhe,2022-03-31,3,,incubating, +2022,6th_bridge,377,smhe,2022-04-07,3,,incubating, +2022,6th_bridge,377,smhe,2022-04-14,,,missed, +2022,6th_bridge,377,smhe,2022-04-21,,,missed, +2022,6th_bridge,405,whib,2022-02-19,,,,"4/7: gone" +2022,6th_bridge,405,whib,2022-02-24,,,,"4/7: gone" +2022,6th_bridge,405,whib,2022-03-03,,,,"4/7: gone" +2022,6th_bridge,405,whib,2022-03-17,,,,"4/7: gone" +2022,6th_bridge,405,whib,2022-03-23,,,,"4/7: gone" +2022,6th_bridge,405,whib,2022-03-31,2,,incubating,"4/7: gone" +2022,6th_bridge,405,whib,2022-04-07,,,empty,"4/7: gone" +2022,6th_bridge,405,whib,2022-04-14,,,,"4/7: gone" +2022,6th_bridge,405,whib,2022-04-21,,,missed,"4/7: gone" +2022,6th_bridge,407,whib,2022-02-19,,,, +2022,6th_bridge,407,whib,2022-02-24,,,, +2022,6th_bridge,407,whib,2022-03-03,,,, +2022,6th_bridge,407,whib,2022-03-17,,,, +2022,6th_bridge,407,whib,2022-03-23,,,, +2022,6th_bridge,407,whib,2022-03-31,3,,incubating, +2022,6th_bridge,407,whib,2022-04-07,3,,incubating, +2022,6th_bridge,407,whib,2022-04-14,1,1,hatching, +2022,6th_bridge,407,whib,2022-04-21,,,missed, +2022,6th_bridge,409,whib,2022-02-19,,,,"4/14: 1 pipping, 4/21: +1 dead" +2022,6th_bridge,409,whib,2022-02-24,,,,"4/14: 1 pipping, 4/21: +1 dead" +2022,6th_bridge,409,whib,2022-03-03,,,,"4/14: 1 pipping, 4/21: +1 dead" +2022,6th_bridge,409,whib,2022-03-17,,,,"4/14: 1 pipping, 4/21: +1 dead" +2022,6th_bridge,409,whib,2022-03-23,,,,"4/14: 1 pipping, 4/21: +1 dead" +2022,6th_bridge,409,whib,2022-03-31,3,,incubating,"4/14: 1 pipping, 4/21: +1 dead" +2022,6th_bridge,409,whib,2022-04-07,3,,incubating,"4/14: 1 pipping, 4/21: +1 dead" +2022,6th_bridge,409,whib,2022-04-14,2,1,pipping,"4/14: 1 pipping, 4/21: +1 dead" +2022,6th_bridge,409,whib,2022-04-21,,1,nestling,"4/14: 1 pipping, 4/21: +1 dead" +2022,6th_bridge,479,smwh,2022-02-19,,,,"4/21: smwh" +2022,6th_bridge,479,smwh,2022-02-24,,,,"4/21: smwh" +2022,6th_bridge,479,smwh,2022-03-03,,,,"4/21: smwh" +2022,6th_bridge,479,smwh,2022-03-17,,,,"4/21: smwh" +2022,6th_bridge,479,smwh,2022-03-23,,,,"4/21: smwh" +2022,6th_bridge,479,smwh,2022-03-31,3,,incubating,"4/21: smwh" +2022,6th_bridge,479,smwh,2022-04-07,3,,incubating,"4/21: smwh" +2022,6th_bridge,479,smwh,2022-04-14,3,,incubating,"4/21: smwh" +2022,6th_bridge,479,smwh,2022-04-21,,3,nestling,"4/21: smwh" +2022,6th_bridge,497,smhe,2022-02-19,,,, +2022,6th_bridge,497,smhe,2022-02-24,,,, +2022,6th_bridge,497,smhe,2022-03-03,,,, +2022,6th_bridge,497,smhe,2022-03-17,,,, +2022,6th_bridge,497,smhe,2022-03-23,,,, +2022,6th_bridge,497,smhe,2022-03-31,,,, +2022,6th_bridge,497,smhe,2022-04-07,3,,incubating, +2022,6th_bridge,497,smhe,2022-04-14,1,,incubating, +2022,6th_bridge,497,smhe,2022-04-21,,,empty, +2022,6th_bridge,481,glib,2022-02-19,,,, +2022,6th_bridge,481,glib,2022-02-24,,,, +2022,6th_bridge,481,glib,2022-03-03,,,, +2022,6th_bridge,481,glib,2022-03-17,,,, +2022,6th_bridge,481,glib,2022-03-23,,,, +2022,6th_bridge,481,glib,2022-03-31,1,,incubating, +2022,6th_bridge,481,glib,2022-04-07,3,,incubating, +2022,6th_bridge,481,glib,2022-04-14,2,,incubating, +2022,6th_bridge,481,glib,2022-04-21,2,,incubating, +2022,6th_bridge,411,smwh,2022-02-19,,,,"4/21: smwh" +2022,6th_bridge,411,smwh,2022-02-24,,,,"4/21: smwh" +2022,6th_bridge,411,smwh,2022-03-03,,,,"4/21: smwh" +2022,6th_bridge,411,smwh,2022-03-17,,,,"4/21: smwh" +2022,6th_bridge,411,smwh,2022-03-23,,,,"4/21: smwh" +2022,6th_bridge,411,smwh,2022-03-31,3,,incubating,"4/21: smwh" +2022,6th_bridge,411,smwh,2022-04-07,3,,incubating,"4/21: smwh" +2022,6th_bridge,411,smwh,2022-04-14,3,,incubating,"4/21: smwh" +2022,6th_bridge,411,smwh,2022-04-21,1,2,hatching,"4/21: smwh" +2022,6th_bridge,413,glib,2022-02-19,,,, +2022,6th_bridge,413,glib,2022-02-24,,,, +2022,6th_bridge,413,glib,2022-03-03,,,, +2022,6th_bridge,413,glib,2022-03-17,,,, +2022,6th_bridge,413,glib,2022-03-23,,,, +2022,6th_bridge,413,glib,2022-03-31,3,,incubating, +2022,6th_bridge,413,glib,2022-04-07,3,,incubating, +2022,6th_bridge,413,glib,2022-04-14,3,,incubating, +2022,6th_bridge,413,glib,2022-04-21,,2,nestling, +2022,6th_bridge,415,sneg,2022-02-19,,,,"4/7: smwh, 4/21: snowy" +2022,6th_bridge,415,sneg,2022-02-24,,,,"4/7: smwh, 4/21: snowy" +2022,6th_bridge,415,sneg,2022-03-03,,,,"4/7: smwh, 4/21: snowy" +2022,6th_bridge,415,sneg,2022-03-17,,,,"4/7: smwh, 4/21: snowy" +2022,6th_bridge,415,sneg,2022-03-23,,,,"4/7: smwh, 4/21: snowy" +2022,6th_bridge,415,sneg,2022-03-31,3,,incubating,"4/7: smwh, 4/21: snowy" +2022,6th_bridge,415,sneg,2022-04-07,1,2,hatching,"4/7: smwh, 4/21: snowy" +2022,6th_bridge,415,sneg,2022-04-14,,2,nestling,"4/7: smwh, 4/21: snowy" +2022,6th_bridge,415,sneg,2022-04-21,,2,nestling,"4/7: smwh, 4/21: snowy" +2022,6th_bridge,483,trhe,2022-02-19,,,,"4/14: trhe" +2022,6th_bridge,483,trhe,2022-02-24,,,,"4/14: trhe" +2022,6th_bridge,483,trhe,2022-03-03,,,,"4/14: trhe" +2022,6th_bridge,483,trhe,2022-03-17,,,,"4/14: trhe" +2022,6th_bridge,483,trhe,2022-03-23,,,,"4/14: trhe" +2022,6th_bridge,483,trhe,2022-03-31,3,,incubating,"4/14: trhe" +2022,6th_bridge,483,trhe,2022-04-07,3,,incubating,"4/14: trhe" +2022,6th_bridge,483,trhe,2022-04-14,,2,nestling,"4/14: trhe" +2022,6th_bridge,483,trhe,2022-04-21,,2,nestling,"4/14: trhe" +2022,6th_bridge,417,glib,2022-02-19,,,, +2022,6th_bridge,417,glib,2022-02-24,,,, +2022,6th_bridge,417,glib,2022-03-03,,,, +2022,6th_bridge,417,glib,2022-03-17,,,, +2022,6th_bridge,417,glib,2022-03-23,,,, +2022,6th_bridge,417,glib,2022-03-31,2,,incubating, +2022,6th_bridge,417,glib,2022-04-07,4,,incubating, +2022,6th_bridge,417,glib,2022-04-14,4,,incubating, +2022,6th_bridge,417,glib,2022-04-21,1,3,hatching, +2022,6th_bridge,419,sneg,2022-02-19,,,,"4/14: smwh, 4/21: snowy" +2022,6th_bridge,419,sneg,2022-02-24,,,,"4/14: smwh, 4/21: snowy" +2022,6th_bridge,419,sneg,2022-03-03,,,,"4/14: smwh, 4/21: snowy" +2022,6th_bridge,419,sneg,2022-03-17,,,,"4/14: smwh, 4/21: snowy" +2022,6th_bridge,419,sneg,2022-03-23,,,,"4/14: smwh, 4/21: snowy" +2022,6th_bridge,419,sneg,2022-03-31,3,,incubating,"4/14: smwh, 4/21: snowy" +2022,6th_bridge,419,sneg,2022-04-07,3,,incubating,"4/14: smwh, 4/21: snowy" +2022,6th_bridge,419,sneg,2022-04-14,,3,nestling,"4/14: smwh, 4/21: snowy" +2022,6th_bridge,419,sneg,2022-04-21,,3,nestling,"4/14: smwh, 4/21: snowy" +2022,6th_bridge,485,trhe,2022-02-19,,,,"4/7: one egg pipping, 4/14: trhe" +2022,6th_bridge,485,trhe,2022-02-24,,,,"4/7: one egg pipping, 4/14: trhe" +2022,6th_bridge,485,trhe,2022-03-03,,,,"4/7: one egg pipping, 4/14: trhe" +2022,6th_bridge,485,trhe,2022-03-17,,,,"4/7: one egg pipping, 4/14: trhe" +2022,6th_bridge,485,trhe,2022-03-23,,,,"4/7: one egg pipping, 4/14: trhe" +2022,6th_bridge,485,trhe,2022-03-31,4,,incubating,"4/7: one egg pipping, 4/14: trhe" +2022,6th_bridge,485,trhe,2022-04-07,4,,pipping,"4/7: one egg pipping, 4/14: trhe" +2022,6th_bridge,485,trhe,2022-04-14,,4,nestling,"4/7: one egg pipping, 4/14: trhe" +2022,6th_bridge,485,trhe,2022-04-21,,3,nestling,"4/7: one egg pipping, 4/14: trhe" +2022,6th_bridge,487,glib,2022-02-19,,,,"4/21: pipping" +2022,6th_bridge,487,glib,2022-02-24,,,,"4/21: pipping" +2022,6th_bridge,487,glib,2022-03-03,,,,"4/21: pipping" +2022,6th_bridge,487,glib,2022-03-17,,,,"4/21: pipping" +2022,6th_bridge,487,glib,2022-03-23,,,,"4/21: pipping" +2022,6th_bridge,487,glib,2022-03-31,2,,incubating,"4/21: pipping" +2022,6th_bridge,487,glib,2022-04-07,3,,incubating,"4/21: pipping" +2022,6th_bridge,487,glib,2022-04-14,3,,incubating,"4/21: pipping" +2022,6th_bridge,487,glib,2022-04-21,1,2,pipping,"4/21: pipping" +2022,6th_bridge,421,rosp,2022-02-19,,,,"4/7: rosp?, 4/14: rosp" +2022,6th_bridge,421,rosp,2022-02-24,,,,"4/7: rosp?, 4/14: rosp" +2022,6th_bridge,421,rosp,2022-03-03,,,,"4/7: rosp?, 4/14: rosp" +2022,6th_bridge,421,rosp,2022-03-17,,,,"4/7: rosp?, 4/14: rosp" +2022,6th_bridge,421,rosp,2022-03-23,,,,"4/7: rosp?, 4/14: rosp" +2022,6th_bridge,421,rosp,2022-03-31,3,,incubating,"4/7: rosp?, 4/14: rosp" +2022,6th_bridge,421,rosp,2022-04-07,3,,incubating,"4/7: rosp?, 4/14: rosp" +2022,6th_bridge,421,rosp,2022-04-14,1,2,hatching,"4/7: rosp?, 4/14: rosp" +2022,6th_bridge,421,rosp,2022-04-21,,,missed,"4/7: rosp?, 4/14: rosp" +2022,6th_bridge,425,trhe,2022-02-19,,,,"4/14: trhe" +2022,6th_bridge,425,trhe,2022-02-24,,,,"4/14: trhe" +2022,6th_bridge,425,trhe,2022-03-03,,,,"4/14: trhe" +2022,6th_bridge,425,trhe,2022-03-17,,,,"4/14: trhe" +2022,6th_bridge,425,trhe,2022-03-23,,,,"4/14: trhe" +2022,6th_bridge,425,trhe,2022-03-31,3,,incubating,"4/14: trhe" +2022,6th_bridge,425,trhe,2022-04-07,3,,incubating,"4/14: trhe" +2022,6th_bridge,425,trhe,2022-04-14,,3,nestling,"4/14: trhe" +2022,6th_bridge,425,trhe,2022-04-21,,3,nestling,"4/14: trhe" +2022,6th_bridge,423,smwh,2022-02-19,,,,"4/21: smwh" +2022,6th_bridge,423,smwh,2022-02-24,,,,"4/21: smwh" +2022,6th_bridge,423,smwh,2022-03-03,,,,"4/21: smwh" +2022,6th_bridge,423,smwh,2022-03-17,,,,"4/21: smwh" +2022,6th_bridge,423,smwh,2022-03-23,,,,"4/21: smwh" +2022,6th_bridge,423,smwh,2022-03-31,3,,incubating,"4/21: smwh" +2022,6th_bridge,423,smwh,2022-04-07,3,,incubating,"4/21: smwh" +2022,6th_bridge,423,smwh,2022-04-14,3,,incubating,"4/21: smwh" +2022,6th_bridge,423,smwh,2022-04-21,,3,nestling,"4/21: smwh" +2022,6th_bridge,427,smwh,2022-02-19,,,,"4/14: smwh" +2022,6th_bridge,427,smwh,2022-02-24,,,,"4/14: smwh" +2022,6th_bridge,427,smwh,2022-03-03,,,,"4/14: smwh" +2022,6th_bridge,427,smwh,2022-03-17,,,,"4/14: smwh" +2022,6th_bridge,427,smwh,2022-03-23,,,,"4/14: smwh" +2022,6th_bridge,427,smwh,2022-03-31,3,,incubating,"4/14: smwh" +2022,6th_bridge,427,smwh,2022-04-07,3,,incubating,"4/14: smwh" +2022,6th_bridge,427,smwh,2022-04-14,,3,nestling,"4/14: smwh" +2022,6th_bridge,427,smwh,2022-04-21,,2,nestling,"4/14: smwh" +2022,6th_bridge,489,smwh,2022-02-19,,,,"4/21: smwh" +2022,6th_bridge,489,smwh,2022-02-24,,,,"4/21: smwh" +2022,6th_bridge,489,smwh,2022-03-03,,,,"4/21: smwh" +2022,6th_bridge,489,smwh,2022-03-17,,,,"4/21: smwh" +2022,6th_bridge,489,smwh,2022-03-23,,,,"4/21: smwh" +2022,6th_bridge,489,smwh,2022-03-31,2,,incubating,"4/21: smwh" +2022,6th_bridge,489,smwh,2022-04-07,2,,incubating,"4/21: smwh" +2022,6th_bridge,489,smwh,2022-04-14,2,,incubating,"4/21: smwh" +2022,6th_bridge,489,smwh,2022-04-21,,2,nestling,"4/21: smwh" +2022,6th_bridge,429,smhe,2022-02-19,,,, +2022,6th_bridge,429,smhe,2022-02-24,,,, +2022,6th_bridge,429,smhe,2022-03-03,,,, +2022,6th_bridge,429,smhe,2022-03-17,,,, +2022,6th_bridge,429,smhe,2022-03-23,,,, +2022,6th_bridge,429,smhe,2022-03-31,4,,incubating, +2022,6th_bridge,429,smhe,2022-04-07,4,,incubating, +2022,6th_bridge,429,smhe,2022-04-14,4,,incubating, +2022,6th_bridge,429,smhe,2022-04-21,,,missed, +2022,6th_bridge,491,whib,2022-02-19,,,, +2022,6th_bridge,491,whib,2022-02-24,,,, +2022,6th_bridge,491,whib,2022-03-03,,,, +2022,6th_bridge,491,whib,2022-03-17,,,, +2022,6th_bridge,491,whib,2022-03-23,,,, +2022,6th_bridge,491,whib,2022-03-31,2,,incubating, +2022,6th_bridge,491,whib,2022-04-07,2,,incubating, +2022,6th_bridge,491,whib,2022-04-14,,2,nestling, +2022,6th_bridge,491,whib,2022-04-21,,2,nestling, +2022,6th_bridge,493,whib,2022-02-19,,,, +2022,6th_bridge,493,whib,2022-02-24,,,, +2022,6th_bridge,493,whib,2022-03-03,,,, +2022,6th_bridge,493,whib,2022-03-17,,,, +2022,6th_bridge,493,whib,2022-03-23,,,, +2022,6th_bridge,493,whib,2022-03-31,3,,incubating, +2022,6th_bridge,493,whib,2022-04-07,3,,incubating, +2022,6th_bridge,493,whib,2022-04-14,2,1,hatching, +2022,6th_bridge,493,whib,2022-04-21,1,1,hatching, +2022,6th_bridge,431,whib,2022-02-19,,,, +2022,6th_bridge,431,whib,2022-02-24,,,, +2022,6th_bridge,431,whib,2022-03-03,,,, +2022,6th_bridge,431,whib,2022-03-17,,,, +2022,6th_bridge,431,whib,2022-03-23,,,, +2022,6th_bridge,431,whib,2022-03-31,1,,incubating, +2022,6th_bridge,431,whib,2022-04-07,1,,incubating, +2022,6th_bridge,431,whib,2022-04-14,,1,nestling, +2022,6th_bridge,431,whib,2022-04-21,,,empty, +2022,6th_bridge,433,smwh,2022-02-19,,,,"4/7: smwh" +2022,6th_bridge,433,smwh,2022-02-24,,,,"4/7: smwh" +2022,6th_bridge,433,smwh,2022-03-03,,,,"4/7: smwh" +2022,6th_bridge,433,smwh,2022-03-17,,,,"4/7: smwh" +2022,6th_bridge,433,smwh,2022-03-23,,,,"4/7: smwh" +2022,6th_bridge,433,smwh,2022-03-31,4,,incubating,"4/7: smwh" +2022,6th_bridge,433,smwh,2022-04-07,,4,nestling,"4/7: smwh" +2022,6th_bridge,433,smwh,2022-04-14,,4,nestling,"4/7: smwh" +2022,6th_bridge,433,smwh,2022-04-21,,,empty,"4/7: smwh" +2022,6th_bridge,499,smhe,2022-02-19,,,, +2022,6th_bridge,499,smhe,2022-02-24,,,, +2022,6th_bridge,499,smhe,2022-03-03,,,, +2022,6th_bridge,499,smhe,2022-03-17,,,, +2022,6th_bridge,499,smhe,2022-03-23,,,, +2022,6th_bridge,499,smhe,2022-03-31,,,, +2022,6th_bridge,499,smhe,2022-04-07,2,,incubating, +2022,6th_bridge,499,smhe,2022-04-14,,,empty, +2022,6th_bridge,499,smhe,2022-04-21,,,empty, +2022,6th_bridge,501,whib,2022-02-19,,,, +2022,6th_bridge,501,whib,2022-02-24,,,, +2022,6th_bridge,501,whib,2022-03-03,,,, +2022,6th_bridge,501,whib,2022-03-17,,,, +2022,6th_bridge,501,whib,2022-03-23,,,, +2022,6th_bridge,501,whib,2022-03-31,,,, +2022,6th_bridge,501,whib,2022-04-07,2,,incubating, +2022,6th_bridge,501,whib,2022-04-14,,2,nestling, +2022,6th_bridge,501,whib,2022-04-21,,1,nestling, +2022,6th_bridge,507,glib,2022-02-19,,,,"4/21: gone" +2022,6th_bridge,507,glib,2022-02-24,,,,"4/21: gone" +2022,6th_bridge,507,glib,2022-03-03,,,,"4/21: gone" +2022,6th_bridge,507,glib,2022-03-17,,,,"4/21: gone" +2022,6th_bridge,507,glib,2022-03-23,,,,"4/21: gone" +2022,6th_bridge,507,glib,2022-03-31,,,,"4/21: gone" +2022,6th_bridge,507,glib,2022-04-07,3,,incubating,"4/21: gone" +2022,6th_bridge,507,glib,2022-04-14,,,missed,"4/21: gone" +2022,6th_bridge,507,glib,2022-04-21,,,empty,"4/21: gone" +2022,6th_bridge,509,glib,2022-02-19,,,, +2022,6th_bridge,509,glib,2022-02-24,,,, +2022,6th_bridge,509,glib,2022-03-03,,,, +2022,6th_bridge,509,glib,2022-03-17,,,, +2022,6th_bridge,509,glib,2022-03-23,,,, +2022,6th_bridge,509,glib,2022-03-31,,,, +2022,6th_bridge,509,glib,2022-04-07,3,,incubating, +2022,6th_bridge,509,glib,2022-04-14,3,,incubating, +2022,6th_bridge,509,glib,2022-04-21,3,,incubating, +2022,6th_bridge,463,whib,2022-02-19,,,, +2022,6th_bridge,463,whib,2022-02-24,,,, +2022,6th_bridge,463,whib,2022-03-03,,,, +2022,6th_bridge,463,whib,2022-03-17,,,, +2022,6th_bridge,463,whib,2022-03-23,,,, +2022,6th_bridge,463,whib,2022-03-31,,,, +2022,6th_bridge,463,whib,2022-04-07,2,,incubating, +2022,6th_bridge,463,whib,2022-04-14,,,missed, +2022,6th_bridge,463,whib,2022-04-21,2,,incubating, +2022,6th_bridge,503,smhe,2022-02-19,,,, +2022,6th_bridge,503,smhe,2022-02-24,,,, +2022,6th_bridge,503,smhe,2022-03-03,,,, +2022,6th_bridge,503,smhe,2022-03-17,,,, +2022,6th_bridge,503,smhe,2022-03-23,,,, +2022,6th_bridge,503,smhe,2022-03-31,,,, +2022,6th_bridge,503,smhe,2022-04-07,3,,incubating, +2022,6th_bridge,503,smhe,2022-04-14,3,,incubating, +2022,6th_bridge,503,smhe,2022-04-21,3,,incubating, +2022,6th_bridge,511,glib,2022-02-19,,,,"4/14: gone" +2022,6th_bridge,511,glib,2022-02-24,,,,"4/14: gone" +2022,6th_bridge,511,glib,2022-03-03,,,,"4/14: gone" +2022,6th_bridge,511,glib,2022-03-17,,,,"4/14: gone" +2022,6th_bridge,511,glib,2022-03-23,,,,"4/14: gone" +2022,6th_bridge,511,glib,2022-03-31,,,,"4/14: gone" +2022,6th_bridge,511,glib,2022-04-07,3,,incubating,"4/14: gone" +2022,6th_bridge,511,glib,2022-04-14,,,empty,"4/14: gone" +2022,6th_bridge,511,glib,2022-04-21,,,empty,"4/14: gone" +2022,6th_bridge,505,glib,2022-02-19,,,, +2022,6th_bridge,505,glib,2022-02-24,,,, +2022,6th_bridge,505,glib,2022-03-03,,,, +2022,6th_bridge,505,glib,2022-03-17,,,, +2022,6th_bridge,505,glib,2022-03-23,,,, +2022,6th_bridge,505,glib,2022-03-31,,,, +2022,6th_bridge,505,glib,2022-04-07,3,,incubating, +2022,6th_bridge,505,glib,2022-04-14,,,missed, +2022,6th_bridge,505,glib,2022-04-21,,,missed, +2022,6th_bridge,513,smhe,2022-02-19,,,, +2022,6th_bridge,513,smhe,2022-02-24,,,, +2022,6th_bridge,513,smhe,2022-03-03,,,, +2022,6th_bridge,513,smhe,2022-03-17,,,, +2022,6th_bridge,513,smhe,2022-03-23,,,, +2022,6th_bridge,513,smhe,2022-03-31,,,, +2022,6th_bridge,513,smhe,2022-04-07,3,,incubating, +2022,6th_bridge,513,smhe,2022-04-14,3,,incubating, +2022,6th_bridge,513,smhe,2022-04-21,3,,incubating, +2022,6th_bridge,515,whib,2022-02-19,,,, +2022,6th_bridge,515,whib,2022-02-24,,,, +2022,6th_bridge,515,whib,2022-03-03,,,, +2022,6th_bridge,515,whib,2022-03-17,,,, +2022,6th_bridge,515,whib,2022-03-23,,,, +2022,6th_bridge,515,whib,2022-03-31,,,, +2022,6th_bridge,515,whib,2022-04-07,3,,incubating, +2022,6th_bridge,515,whib,2022-04-14,1,,incubating, +2022,6th_bridge,515,whib,2022-04-21,,,empty, +2022,6th_bridge,517,smhe,2022-02-19,,,, +2022,6th_bridge,517,smhe,2022-02-24,,,, +2022,6th_bridge,517,smhe,2022-03-03,,,, +2022,6th_bridge,517,smhe,2022-03-17,,,, +2022,6th_bridge,517,smhe,2022-03-23,,,, +2022,6th_bridge,517,smhe,2022-03-31,,,, +2022,6th_bridge,517,smhe,2022-04-07,1,,incubating, +2022,6th_bridge,517,smhe,2022-04-14,3,,incubating, +2022,6th_bridge,517,smhe,2022-04-21,2,,incubating, +2022,6th_bridge,519,glib,2022-02-19,,,, +2022,6th_bridge,519,glib,2022-02-24,,,, +2022,6th_bridge,519,glib,2022-03-03,,,, +2022,6th_bridge,519,glib,2022-03-17,,,, +2022,6th_bridge,519,glib,2022-03-23,,,, +2022,6th_bridge,519,glib,2022-03-31,,,, +2022,6th_bridge,519,glib,2022-04-07,3,,incubating, +2022,6th_bridge,519,glib,2022-04-14,3,,incubating, +2022,6th_bridge,519,glib,2022-04-21,3,,incubating, +2022,6th_bridge,521,glib,2022-02-19,,,, +2022,6th_bridge,521,glib,2022-02-24,,,, +2022,6th_bridge,521,glib,2022-03-03,,,, +2022,6th_bridge,521,glib,2022-03-17,,,, +2022,6th_bridge,521,glib,2022-03-23,,,, +2022,6th_bridge,521,glib,2022-03-31,,,, +2022,6th_bridge,521,glib,2022-04-07,3,,incubating, +2022,6th_bridge,521,glib,2022-04-14,3,,incubating, +2022,6th_bridge,521,glib,2022-04-21,2,1,hatching, +2022,6th_bridge,523,glib,2022-02-19,,,, +2022,6th_bridge,523,glib,2022-02-24,,,, +2022,6th_bridge,523,glib,2022-03-03,,,, +2022,6th_bridge,523,glib,2022-03-17,,,, +2022,6th_bridge,523,glib,2022-03-23,,,, +2022,6th_bridge,523,glib,2022-03-31,,,, +2022,6th_bridge,523,glib,2022-04-07,3,,incubating, +2022,6th_bridge,523,glib,2022-04-14,3,,incubating, +2022,6th_bridge,523,glib,2022-04-21,3,,incubating, +2022,6th_bridge,525,glib,2022-02-19,,,, +2022,6th_bridge,525,glib,2022-02-24,,,, +2022,6th_bridge,525,glib,2022-03-03,,,, +2022,6th_bridge,525,glib,2022-03-17,,,, +2022,6th_bridge,525,glib,2022-03-23,,,, +2022,6th_bridge,525,glib,2022-03-31,,,, +2022,6th_bridge,525,glib,2022-04-07,3,,incubating, +2022,6th_bridge,525,glib,2022-04-14,3,,incubating, +2022,6th_bridge,525,glib,2022-04-21,,,missed, +2022,6th_bridge,527,glib,2022-02-19,,,, +2022,6th_bridge,527,glib,2022-02-24,,,, +2022,6th_bridge,527,glib,2022-03-03,,,, +2022,6th_bridge,527,glib,2022-03-17,,,, +2022,6th_bridge,527,glib,2022-03-23,,,, +2022,6th_bridge,527,glib,2022-03-31,,,, +2022,6th_bridge,527,glib,2022-04-07,3,,incubating, +2022,6th_bridge,527,glib,2022-04-14,3,,incubating, +2022,6th_bridge,527,glib,2022-04-21,3,,incubating, +2022,6th_bridge,529,glib,2022-02-19,,,,"4/21: 1e pipping" +2022,6th_bridge,529,glib,2022-02-24,,,,"4/21: 1e pipping" +2022,6th_bridge,529,glib,2022-03-03,,,,"4/21: 1e pipping" +2022,6th_bridge,529,glib,2022-03-17,,,,"4/21: 1e pipping" +2022,6th_bridge,529,glib,2022-03-23,,,,"4/21: 1e pipping" +2022,6th_bridge,529,glib,2022-03-31,,,,"4/21: 1e pipping" +2022,6th_bridge,529,glib,2022-04-07,3,,incubating,"4/21: 1e pipping" +2022,6th_bridge,529,glib,2022-04-14,3,,incubating,"4/21: 1e pipping" +2022,6th_bridge,529,glib,2022-04-21,3,,pipping,"4/21: 1e pipping" +2022,6th_bridge,531,glib,2022-02-19,,,, +2022,6th_bridge,531,glib,2022-02-24,,,, +2022,6th_bridge,531,glib,2022-03-03,,,, +2022,6th_bridge,531,glib,2022-03-17,,,, +2022,6th_bridge,531,glib,2022-03-23,,,, +2022,6th_bridge,531,glib,2022-03-31,,,, +2022,6th_bridge,531,glib,2022-04-07,3,,incubating, +2022,6th_bridge,531,glib,2022-04-14,3,,incubating, +2022,6th_bridge,531,glib,2022-04-21,3,,incubating, +2022,6th_bridge,533,glib,2022-02-19,,,, +2022,6th_bridge,533,glib,2022-02-24,,,, +2022,6th_bridge,533,glib,2022-03-03,,,, +2022,6th_bridge,533,glib,2022-03-17,,,, +2022,6th_bridge,533,glib,2022-03-23,,,, +2022,6th_bridge,533,glib,2022-03-31,,,, +2022,6th_bridge,533,glib,2022-04-07,3,,incubating, +2022,6th_bridge,533,glib,2022-04-14,3,,incubating, +2022,6th_bridge,533,glib,2022-04-21,3,,incubating, +2022,6th_bridge,535,glib,2022-02-19,,,, +2022,6th_bridge,535,glib,2022-02-24,,,, +2022,6th_bridge,535,glib,2022-03-03,,,, +2022,6th_bridge,535,glib,2022-03-17,,,, +2022,6th_bridge,535,glib,2022-03-23,,,, +2022,6th_bridge,535,glib,2022-03-31,,,, +2022,6th_bridge,535,glib,2022-04-07,3,,incubating, +2022,6th_bridge,535,glib,2022-04-14,3,,incubating, +2022,6th_bridge,535,glib,2022-04-21,3,,incubating, +2022,6th_bridge,539,glib,2022-02-19,,,, +2022,6th_bridge,539,glib,2022-02-24,,,, +2022,6th_bridge,539,glib,2022-03-03,,,, +2022,6th_bridge,539,glib,2022-03-17,,,, +2022,6th_bridge,539,glib,2022-03-23,,,, +2022,6th_bridge,539,glib,2022-03-31,,,, +2022,6th_bridge,539,glib,2022-04-07,3,,incubating, +2022,6th_bridge,539,glib,2022-04-14,3,,incubating, +2022,6th_bridge,539,glib,2022-04-21,2,1,hatching, +2022,6th_bridge,537,smhe,2022-02-19,,,, +2022,6th_bridge,537,smhe,2022-02-24,,,, +2022,6th_bridge,537,smhe,2022-03-03,,,, +2022,6th_bridge,537,smhe,2022-03-17,,,, +2022,6th_bridge,537,smhe,2022-03-23,,,, +2022,6th_bridge,537,smhe,2022-03-31,,,, +2022,6th_bridge,537,smhe,2022-04-07,2,,incubating, +2022,6th_bridge,537,smhe,2022-04-14,3,,incubating, +2022,6th_bridge,537,smhe,2022-04-21,3,,incubating, +2022,6th_bridge,541,glib,2022-02-19,,,, +2022,6th_bridge,541,glib,2022-02-24,,,, +2022,6th_bridge,541,glib,2022-03-03,,,, +2022,6th_bridge,541,glib,2022-03-17,,,, +2022,6th_bridge,541,glib,2022-03-23,,,, +2022,6th_bridge,541,glib,2022-03-31,,,, +2022,6th_bridge,541,glib,2022-04-07,3,,incubating, +2022,6th_bridge,541,glib,2022-04-14,3,,incubating, +2022,6th_bridge,541,glib,2022-04-21,3,,incubating, +2022,6th_bridge,545,glib,2022-02-19,,,, +2022,6th_bridge,545,glib,2022-02-24,,,, +2022,6th_bridge,545,glib,2022-03-03,,,, +2022,6th_bridge,545,glib,2022-03-17,,,, +2022,6th_bridge,545,glib,2022-03-23,,,, +2022,6th_bridge,545,glib,2022-03-31,,,, +2022,6th_bridge,545,glib,2022-04-07,,,, +2022,6th_bridge,545,glib,2022-04-14,3,,incubating, +2022,6th_bridge,545,glib,2022-04-21,3,,incubating, +2022,6th_bridge,547,glib,2022-02-19,,,, +2022,6th_bridge,547,glib,2022-02-24,,,, +2022,6th_bridge,547,glib,2022-03-03,,,, +2022,6th_bridge,547,glib,2022-03-17,,,, +2022,6th_bridge,547,glib,2022-03-23,,,, +2022,6th_bridge,547,glib,2022-03-31,,,, +2022,6th_bridge,547,glib,2022-04-07,,,, +2022,6th_bridge,547,glib,2022-04-14,3,,incubating, +2022,6th_bridge,547,glib,2022-04-21,1,,incubating, +2022,6th_bridge,549,smhe,2022-02-19,,,,"4/21: 1e pipping" +2022,6th_bridge,549,smhe,2022-02-24,,,,"4/21: 1e pipping" +2022,6th_bridge,549,smhe,2022-03-03,,,,"4/21: 1e pipping" +2022,6th_bridge,549,smhe,2022-03-17,,,,"4/21: 1e pipping" +2022,6th_bridge,549,smhe,2022-03-23,,,,"4/21: 1e pipping" +2022,6th_bridge,549,smhe,2022-03-31,,,,"4/21: 1e pipping" +2022,6th_bridge,549,smhe,2022-04-07,,,,"4/21: 1e pipping" +2022,6th_bridge,549,smhe,2022-04-14,4,,incubating,"4/21: 1e pipping" +2022,6th_bridge,549,smhe,2022-04-21,4,,pipping,"4/21: 1e pipping" +2022,6th_bridge,551,glib,2022-02-19,,,, +2022,6th_bridge,551,glib,2022-02-24,,,, +2022,6th_bridge,551,glib,2022-03-03,,,, +2022,6th_bridge,551,glib,2022-03-17,,,, +2022,6th_bridge,551,glib,2022-03-23,,,, +2022,6th_bridge,551,glib,2022-03-31,,,, +2022,6th_bridge,551,glib,2022-04-07,,,, +2022,6th_bridge,551,glib,2022-04-14,1,,incubating, +2022,6th_bridge,551,glib,2022-04-21,,,empty, +2022,6th_bridge,553,whib,2022-02-19,,,, +2022,6th_bridge,553,whib,2022-02-24,,,, +2022,6th_bridge,553,whib,2022-03-03,,,, +2022,6th_bridge,553,whib,2022-03-17,,,, +2022,6th_bridge,553,whib,2022-03-23,,,, +2022,6th_bridge,553,whib,2022-03-31,,,, +2022,6th_bridge,553,whib,2022-04-07,,,, +2022,6th_bridge,553,whib,2022-04-14,,2,nestling, +2022,6th_bridge,553,whib,2022-04-21,,1,nestling, +2022,6th_bridge,555,glib,2022-02-19,,,, +2022,6th_bridge,555,glib,2022-02-24,,,, +2022,6th_bridge,555,glib,2022-03-03,,,, +2022,6th_bridge,555,glib,2022-03-17,,,, +2022,6th_bridge,555,glib,2022-03-23,,,, +2022,6th_bridge,555,glib,2022-03-31,,,, +2022,6th_bridge,555,glib,2022-04-07,,,, +2022,6th_bridge,555,glib,2022-04-14,3,,incubating, +2022,6th_bridge,555,glib,2022-04-21,1,2,hatching, +2022,6th_bridge,557,smhe,2022-02-19,,,, +2022,6th_bridge,557,smhe,2022-02-24,,,, +2022,6th_bridge,557,smhe,2022-03-03,,,, +2022,6th_bridge,557,smhe,2022-03-17,,,, +2022,6th_bridge,557,smhe,2022-03-23,,,, +2022,6th_bridge,557,smhe,2022-03-31,,,, +2022,6th_bridge,557,smhe,2022-04-07,,,, +2022,6th_bridge,557,smhe,2022-04-14,2,,incubating, +2022,6th_bridge,557,smhe,2022-04-21,,,empty, +2022,6th_bridge,559,glib,2022-02-19,,,, +2022,6th_bridge,559,glib,2022-02-24,,,, +2022,6th_bridge,559,glib,2022-03-03,,,, +2022,6th_bridge,559,glib,2022-03-17,,,, +2022,6th_bridge,559,glib,2022-03-23,,,, +2022,6th_bridge,559,glib,2022-03-31,,,, +2022,6th_bridge,559,glib,2022-04-07,,,, +2022,6th_bridge,559,glib,2022-04-14,3,,incubating, +2022,6th_bridge,559,glib,2022-04-21,3,,incubating, +2022,6th_bridge,561,glib,2022-02-19,,,, +2022,6th_bridge,561,glib,2022-02-24,,,, +2022,6th_bridge,561,glib,2022-03-03,,,, +2022,6th_bridge,561,glib,2022-03-17,,,, +2022,6th_bridge,561,glib,2022-03-23,,,, +2022,6th_bridge,561,glib,2022-03-31,,,, +2022,6th_bridge,561,glib,2022-04-07,,,, +2022,6th_bridge,561,glib,2022-04-14,1,,incubating, +2022,6th_bridge,561,glib,2022-04-21,3,,incubating, +2022,6th_bridge,563,glib,2022-02-19,,,, +2022,6th_bridge,563,glib,2022-02-24,,,, +2022,6th_bridge,563,glib,2022-03-03,,,, +2022,6th_bridge,563,glib,2022-03-17,,,, +2022,6th_bridge,563,glib,2022-03-23,,,, +2022,6th_bridge,563,glib,2022-03-31,,,, +2022,6th_bridge,563,glib,2022-04-07,,,, +2022,6th_bridge,563,glib,2022-04-14,,,, +2022,6th_bridge,563,glib,2022-04-21,1,,incubating, +2022,6th_bridge,565,grhe,2022-02-19,,,, +2022,6th_bridge,565,grhe,2022-02-24,,,, +2022,6th_bridge,565,grhe,2022-03-03,,,, +2022,6th_bridge,565,grhe,2022-03-17,,,, +2022,6th_bridge,565,grhe,2022-03-23,,,, +2022,6th_bridge,565,grhe,2022-03-31,,,, +2022,6th_bridge,565,grhe,2022-04-07,,,, +2022,6th_bridge,565,grhe,2022-04-14,,,, +2022,6th_bridge,565,grhe,2022-04-21,,3,nestling, +2022,jerrod,173,greg,2022-02-21,,,,"Last nest sequentially. 4/5: eggshell in nest, 4/18: drone--pink paper in nest 11, 4/26: pink paper removed, 5/2: gone, 5/9: gone, 5/24: gone" +2022,jerrod,173,greg,2022-02-28,,,,"Last nest sequentially. 4/5: eggshell in nest, 4/18: drone--pink paper in nest 11, 4/26: pink paper removed, 5/2: gone, 5/9: gone, 5/24: gone" +2022,jerrod,173,greg,2022-03-14,2,,incubating,"Last nest sequentially. 4/5: eggshell in nest, 4/18: drone--pink paper in nest 11, 4/26: pink paper removed, 5/2: gone, 5/9: gone, 5/24: gone" +2022,jerrod,173,greg,2022-03-21,,,empty,"Last nest sequentially. 4/5: eggshell in nest, 4/18: drone--pink paper in nest 11, 4/26: pink paper removed, 5/2: gone, 5/9: gone, 5/24: gone" +2022,jerrod,173,greg,2022-03-28,,,empty,"Last nest sequentially. 4/5: eggshell in nest, 4/18: drone--pink paper in nest 11, 4/26: pink paper removed, 5/2: gone, 5/9: gone, 5/24: gone" +2022,jerrod,173,greg,2022-04-05,,,empty,"Last nest sequentially. 4/5: eggshell in nest, 4/18: drone--pink paper in nest 11, 4/26: pink paper removed, 5/2: gone, 5/9: gone, 5/24: gone" +2022,jerrod,173,greg,2022-04-11,,,empty,"Last nest sequentially. 4/5: eggshell in nest, 4/18: drone--pink paper in nest 11, 4/26: pink paper removed, 5/2: gone, 5/9: gone, 5/24: gone" +2022,jerrod,173,greg,2022-04-18,,,empty,"Last nest sequentially. 4/5: eggshell in nest, 4/18: drone--pink paper in nest 11, 4/26: pink paper removed, 5/2: gone, 5/9: gone, 5/24: gone" +2022,jerrod,173,greg,2022-04-26,,,empty,"Last nest sequentially. 4/5: eggshell in nest, 4/18: drone--pink paper in nest 11, 4/26: pink paper removed, 5/2: gone, 5/9: gone, 5/24: gone" +2022,jerrod,173,greg,2022-05-02,,,collapsed,"Last nest sequentially. 4/5: eggshell in nest, 4/18: drone--pink paper in nest 11, 4/26: pink paper removed, 5/2: gone, 5/9: gone, 5/24: gone" +2022,jerrod,173,greg,2022-05-09,,,collapsed,"Last nest sequentially. 4/5: eggshell in nest, 4/18: drone--pink paper in nest 11, 4/26: pink paper removed, 5/2: gone, 5/9: gone, 5/24: gone" +2022,jerrod,173,greg,2022-05-24,,,collapsed,"Last nest sequentially. 4/5: eggshell in nest, 4/18: drone--pink paper in nest 11, 4/26: pink paper removed, 5/2: gone, 5/9: gone, 5/24: gone" +2022,jerrod,67,gbhe,2022-02-21,2,,incubating,"3/21: shell on ground" +2022,jerrod,67,gbhe,2022-02-28,,,empty,"3/21: shell on ground" +2022,jerrod,67,gbhe,2022-03-14,3,,incubating,"3/21: shell on ground" +2022,jerrod,67,gbhe,2022-03-21,,,empty,"3/21: shell on ground" +2022,jerrod,67,gbhe,2022-03-28,,,empty,"3/21: shell on ground" +2022,jerrod,67,gbhe,2022-04-05,,,empty,"3/21: shell on ground" +2022,jerrod,67,gbhe,2022-04-11,,,empty,"3/21: shell on ground" +2022,jerrod,67,gbhe,2022-04-18,,,missed,"3/21: shell on ground" +2022,jerrod,67,gbhe,2022-04-26,,,empty,"3/21: shell on ground" +2022,jerrod,67,gbhe,2022-05-02,,,empty,"3/21: shell on ground" +2022,jerrod,67,gbhe,2022-05-09,,,empty,"3/21: shell on ground" +2022,jerrod,67,gbhe,2022-05-24,,,missed,"3/21: shell on ground" +2022,jerrod,69,greg,2022-02-21,2,,incubating,"4/18: mercury sampled, 4/26: fledged?, 5/24: orange paper (paper under nest--wind)" +2022,jerrod,69,greg,2022-02-28,2,,incubating,"4/18: mercury sampled, 4/26: fledged?, 5/24: orange paper (paper under nest--wind)" +2022,jerrod,69,greg,2022-03-14,2,,incubating,"4/18: mercury sampled, 4/26: fledged?, 5/24: orange paper (paper under nest--wind)" +2022,jerrod,69,greg,2022-03-21,,2,nestling,"4/18: mercury sampled, 4/26: fledged?, 5/24: orange paper (paper under nest--wind)" +2022,jerrod,69,greg,2022-03-28,,2,nestling,"4/18: mercury sampled, 4/26: fledged?, 5/24: orange paper (paper under nest--wind)" +2022,jerrod,69,greg,2022-04-05,,2,nestling,"4/18: mercury sampled, 4/26: fledged?, 5/24: orange paper (paper under nest--wind)" +2022,jerrod,69,greg,2022-04-11,,2,nestling,"4/18: mercury sampled, 4/26: fledged?, 5/24: orange paper (paper under nest--wind)" +2022,jerrod,69,greg,2022-04-18,,2,nestling,"4/18: mercury sampled, 4/26: fledged?, 5/24: orange paper (paper under nest--wind)" +2022,jerrod,69,greg,2022-04-26,,,empty,"4/18: mercury sampled, 4/26: fledged?, 5/24: orange paper (paper under nest--wind)" +2022,jerrod,69,greg,2022-05-02,,,empty,"4/18: mercury sampled, 4/26: fledged?, 5/24: orange paper (paper under nest--wind)" +2022,jerrod,69,greg,2022-05-09,,,empty,"4/18: mercury sampled, 4/26: fledged?, 5/24: orange paper (paper under nest--wind)" +2022,jerrod,69,greg,2022-05-24,,,empty,"4/18: mercury sampled, 4/26: fledged?, 5/24: orange paper (paper under nest--wind)" +2022,jerrod,26,gbhe,2022-02-21,4,,incubating, +2022,jerrod,26,gbhe,2022-02-28,4,,incubating, +2022,jerrod,26,gbhe,2022-03-14,,2,nestling, +2022,jerrod,26,gbhe,2022-03-21,,2,nestling, +2022,jerrod,26,gbhe,2022-03-28,,1,nestling, +2022,jerrod,26,gbhe,2022-04-05,,1,nestling, +2022,jerrod,26,gbhe,2022-04-11,,1,nestling, +2022,jerrod,26,gbhe,2022-04-18,,1,nestling, +2022,jerrod,26,gbhe,2022-04-26,,1,nestling, +2022,jerrod,26,gbhe,2022-05-02,,1,nestling, +2022,jerrod,26,gbhe,2022-05-09,,1,nestling, +2022,jerrod,26,gbhe,2022-05-24,,1,nestling, +2022,jerrod,153,greg,2022-02-21,,,,"3/21: shell in nest, 4/11: drone--blue flagging, 4/18: removed paper, 4/26: eggshells, 5/24: blue paper in nest" +2022,jerrod,153,greg,2022-02-28,,,,"3/21: shell in nest, 4/11: drone--blue flagging, 4/18: removed paper, 4/26: eggshells, 5/24: blue paper in nest" +2022,jerrod,153,greg,2022-03-14,2,,incubating,"3/21: shell in nest, 4/11: drone--blue flagging, 4/18: removed paper, 4/26: eggshells, 5/24: blue paper in nest" +2022,jerrod,153,greg,2022-03-21,,,empty,"3/21: shell in nest, 4/11: drone--blue flagging, 4/18: removed paper, 4/26: eggshells, 5/24: blue paper in nest" +2022,jerrod,153,greg,2022-03-28,,,empty,"3/21: shell in nest, 4/11: drone--blue flagging, 4/18: removed paper, 4/26: eggshells, 5/24: blue paper in nest" +2022,jerrod,153,greg,2022-04-05,,,empty,"3/21: shell in nest, 4/11: drone--blue flagging, 4/18: removed paper, 4/26: eggshells, 5/24: blue paper in nest" +2022,jerrod,153,greg,2022-04-11,,,empty,"3/21: shell in nest, 4/11: drone--blue flagging, 4/18: removed paper, 4/26: eggshells, 5/24: blue paper in nest" +2022,jerrod,153,greg,2022-04-18,,,empty,"3/21: shell in nest, 4/11: drone--blue flagging, 4/18: removed paper, 4/26: eggshells, 5/24: blue paper in nest" +2022,jerrod,153,greg,2022-04-26,,,empty,"3/21: shell in nest, 4/11: drone--blue flagging, 4/18: removed paper, 4/26: eggshells, 5/24: blue paper in nest" +2022,jerrod,153,greg,2022-05-02,,,empty,"3/21: shell in nest, 4/11: drone--blue flagging, 4/18: removed paper, 4/26: eggshells, 5/24: blue paper in nest" +2022,jerrod,153,greg,2022-05-09,,,empty,"3/21: shell in nest, 4/11: drone--blue flagging, 4/18: removed paper, 4/26: eggshells, 5/24: blue paper in nest" +2022,jerrod,153,greg,2022-05-24,,,empty,"3/21: shell in nest, 4/11: drone--blue flagging, 4/18: removed paper, 4/26: eggshells, 5/24: blue paper in nest" +2022,jerrod,155,greg,2022-02-21,,,,"3/28: egg shell in nest, 5/9: gone, 5/24: nest gone, pink paper in nest, 67 beside this" +2022,jerrod,155,greg,2022-02-28,,,,"3/28: egg shell in nest, 5/9: gone, 5/24: nest gone, pink paper in nest, 67 beside this" +2022,jerrod,155,greg,2022-03-14,2,,incubating,"3/28: egg shell in nest, 5/9: gone, 5/24: nest gone, pink paper in nest, 67 beside this" +2022,jerrod,155,greg,2022-03-21,2,,incubating,"3/28: egg shell in nest, 5/9: gone, 5/24: nest gone, pink paper in nest, 67 beside this" +2022,jerrod,155,greg,2022-03-28,,,empty,"3/28: egg shell in nest, 5/9: gone, 5/24: nest gone, pink paper in nest, 67 beside this" +2022,jerrod,155,greg,2022-04-05,,,missed,"3/28: egg shell in nest, 5/9: gone, 5/24: nest gone, pink paper in nest, 67 beside this" +2022,jerrod,155,greg,2022-04-11,,,empty,"3/28: egg shell in nest, 5/9: gone, 5/24: nest gone, pink paper in nest, 67 beside this" +2022,jerrod,155,greg,2022-04-18,,,empty,"3/28: egg shell in nest, 5/9: gone, 5/24: nest gone, pink paper in nest, 67 beside this" +2022,jerrod,155,greg,2022-04-26,,,empty,"3/28: egg shell in nest, 5/9: gone, 5/24: nest gone, pink paper in nest, 67 beside this" +2022,jerrod,155,greg,2022-05-02,,,empty,"3/28: egg shell in nest, 5/9: gone, 5/24: nest gone, pink paper in nest, 67 beside this" +2022,jerrod,155,greg,2022-05-09,,,collapsed,"3/28: egg shell in nest, 5/9: gone, 5/24: nest gone, pink paper in nest, 67 beside this" +2022,jerrod,155,greg,2022-05-24,,,empty,"3/28: egg shell in nest, 5/9: gone, 5/24: nest gone, pink paper in nest, 67 beside this" +2022,jerrod,71,greg,2022-02-21,2,,incubating,"3/21: collapsed, not pulled! 4/11: drone--blue flagging, 4/18: removed blue, 5/2: partially collapsed, 5/24: nest gone, yellow paper" +2022,jerrod,71,greg,2022-02-28,2,,incubating,"3/21: collapsed, not pulled! 4/11: drone--blue flagging, 4/18: removed blue, 5/2: partially collapsed, 5/24: nest gone, yellow paper" +2022,jerrod,71,greg,2022-03-14,,2,nestling,"3/21: collapsed, not pulled! 4/11: drone--blue flagging, 4/18: removed blue, 5/2: partially collapsed, 5/24: nest gone, yellow paper" +2022,jerrod,71,greg,2022-03-21,,,empty,"3/21: collapsed, not pulled! 4/11: drone--blue flagging, 4/18: removed blue, 5/2: partially collapsed, 5/24: nest gone, yellow paper" +2022,jerrod,71,greg,2022-03-28,,,empty,"3/21: collapsed, not pulled! 4/11: drone--blue flagging, 4/18: removed blue, 5/2: partially collapsed, 5/24: nest gone, yellow paper" +2022,jerrod,71,greg,2022-04-05,,,empty,"3/21: collapsed, not pulled! 4/11: drone--blue flagging, 4/18: removed blue, 5/2: partially collapsed, 5/24: nest gone, yellow paper" +2022,jerrod,71,greg,2022-04-11,,,empty,"3/21: collapsed, not pulled! 4/11: drone--blue flagging, 4/18: removed blue, 5/2: partially collapsed, 5/24: nest gone, yellow paper" +2022,jerrod,71,greg,2022-04-18,,,empty,"3/21: collapsed, not pulled! 4/11: drone--blue flagging, 4/18: removed blue, 5/2: partially collapsed, 5/24: nest gone, yellow paper" +2022,jerrod,71,greg,2022-04-26,,,empty,"3/21: collapsed, not pulled! 4/11: drone--blue flagging, 4/18: removed blue, 5/2: partially collapsed, 5/24: nest gone, yellow paper" +2022,jerrod,71,greg,2022-05-02,,,empty,"3/21: collapsed, not pulled! 4/11: drone--blue flagging, 4/18: removed blue, 5/2: partially collapsed, 5/24: nest gone, yellow paper" +2022,jerrod,71,greg,2022-05-09,,,missed,"3/21: collapsed, not pulled! 4/11: drone--blue flagging, 4/18: removed blue, 5/2: partially collapsed, 5/24: nest gone, yellow paper" +2022,jerrod,71,greg,2022-05-24,,,collapsed,"3/21: collapsed, not pulled! 4/11: drone--blue flagging, 4/18: removed blue, 5/2: partially collapsed, 5/24: nest gone, yellow paper" +2022,jerrod,149,greg,2022-02-21,,,,"After 73. 4/11: one wet chick, 4/18: chicks don't look good, 5/24: blue paper" +2022,jerrod,149,greg,2022-02-28,,,,"After 73. 4/11: one wet chick, 4/18: chicks don't look good, 5/24: blue paper" +2022,jerrod,149,greg,2022-03-14,1,,incubating,"After 73. 4/11: one wet chick, 4/18: chicks don't look good, 5/24: blue paper" +2022,jerrod,149,greg,2022-03-21,3,,incubating,"After 73. 4/11: one wet chick, 4/18: chicks don't look good, 5/24: blue paper" +2022,jerrod,149,greg,2022-03-28,3,,incubating,"After 73. 4/11: one wet chick, 4/18: chicks don't look good, 5/24: blue paper" +2022,jerrod,149,greg,2022-04-05,3,,incubating,"After 73. 4/11: one wet chick, 4/18: chicks don't look good, 5/24: blue paper" +2022,jerrod,149,greg,2022-04-11,1,2,nestling,"After 73. 4/11: one wet chick, 4/18: chicks don't look good, 5/24: blue paper" +2022,jerrod,149,greg,2022-04-18,,3,nestling,"After 73. 4/11: one wet chick, 4/18: chicks don't look good, 5/24: blue paper" +2022,jerrod,149,greg,2022-04-26,,3,nestling,"After 73. 4/11: one wet chick, 4/18: chicks don't look good, 5/24: blue paper" +2022,jerrod,149,greg,2022-05-02,,,missed,"After 73. 4/11: one wet chick, 4/18: chicks don't look good, 5/24: blue paper" +2022,jerrod,149,greg,2022-05-09,,3,nestling,"After 73. 4/11: one wet chick, 4/18: chicks don't look good, 5/24: blue paper" +2022,jerrod,149,greg,2022-05-24,,,empty,"After 73. 4/11: one wet chick, 4/18: chicks don't look good, 5/24: blue paper" +2022,jerrod,157,greg,2022-02-21,,,,"After 73. 4/18: drone--blue paper 2, 4/26: blue paper removed, 5/9: gone" +2022,jerrod,157,greg,2022-02-28,,,,"After 73. 4/18: drone--blue paper 2, 4/26: blue paper removed, 5/9: gone" +2022,jerrod,157,greg,2022-03-14,3,,incubating,"After 73. 4/18: drone--blue paper 2, 4/26: blue paper removed, 5/9: gone" +2022,jerrod,157,greg,2022-03-21,3,,incubating,"After 73. 4/18: drone--blue paper 2, 4/26: blue paper removed, 5/9: gone" +2022,jerrod,157,greg,2022-03-28,,,empty,"After 73. 4/18: drone--blue paper 2, 4/26: blue paper removed, 5/9: gone" +2022,jerrod,157,greg,2022-04-05,,,empty,"After 73. 4/18: drone--blue paper 2, 4/26: blue paper removed, 5/9: gone" +2022,jerrod,157,greg,2022-04-11,,,empty,"After 73. 4/18: drone--blue paper 2, 4/26: blue paper removed, 5/9: gone" +2022,jerrod,157,greg,2022-04-18,,,empty,"After 73. 4/18: drone--blue paper 2, 4/26: blue paper removed, 5/9: gone" +2022,jerrod,157,greg,2022-04-26,,,empty,"After 73. 4/18: drone--blue paper 2, 4/26: blue paper removed, 5/9: gone" +2022,jerrod,157,greg,2022-05-02,,,collapsed,"After 73. 4/18: drone--blue paper 2, 4/26: blue paper removed, 5/9: gone" +2022,jerrod,157,greg,2022-05-09,,,collapsed,"After 73. 4/18: drone--blue paper 2, 4/26: blue paper removed, 5/9: gone" +2022,jerrod,157,greg,2022-05-24,,,empty,"After 73. 4/18: drone--blue paper 2, 4/26: blue paper removed, 5/9: gone" +2022,jerrod,283,greg,2022-02-21,,,,"Near 69." +2022,jerrod,283,greg,2022-02-28,,,,"Near 69." +2022,jerrod,283,greg,2022-03-14,,,,"Near 69." +2022,jerrod,283,greg,2022-03-21,3,,incubating,"Near 69." +2022,jerrod,283,greg,2022-03-28,,,empty,"Near 69." +2022,jerrod,283,greg,2022-04-05,,,empty,"Near 69." +2022,jerrod,283,greg,2022-04-11,,,empty,"Near 69." +2022,jerrod,283,greg,2022-04-18,,,missed,"Near 69." +2022,jerrod,283,greg,2022-04-26,,,missed,"Near 69." +2022,jerrod,283,greg,2022-05-02,,,missed,"Near 69." +2022,jerrod,283,greg,2022-05-09,,,missed,"Near 69." +2022,jerrod,283,greg,2022-05-24,,,missed,"Near 69." +2022,jerrod,73,greg,2022-02-21,3,,incubating,"4/18: drone--pink paper 1 beside, 4/26: pink paper removed, 5/2: mercury done, chick BIG" +2022,jerrod,73,greg,2022-02-28,3,,incubating,"4/18: drone--pink paper 1 beside, 4/26: pink paper removed, 5/2: mercury done, chick BIG" +2022,jerrod,73,greg,2022-03-14,3,,incubating,"4/18: drone--pink paper 1 beside, 4/26: pink paper removed, 5/2: mercury done, chick BIG" +2022,jerrod,73,greg,2022-03-21,1,1,hatching,"4/18: drone--pink paper 1 beside, 4/26: pink paper removed, 5/2: mercury done, chick BIG" +2022,jerrod,73,greg,2022-03-28,1,1,hatching,"4/18: drone--pink paper 1 beside, 4/26: pink paper removed, 5/2: mercury done, chick BIG" +2022,jerrod,73,greg,2022-04-05,1,1,hatching,"4/18: drone--pink paper 1 beside, 4/26: pink paper removed, 5/2: mercury done, chick BIG" +2022,jerrod,73,greg,2022-04-11,,1,nestling,"4/18: drone--pink paper 1 beside, 4/26: pink paper removed, 5/2: mercury done, chick BIG" +2022,jerrod,73,greg,2022-04-18,,1,nestling,"4/18: drone--pink paper 1 beside, 4/26: pink paper removed, 5/2: mercury done, chick BIG" +2022,jerrod,73,greg,2022-04-26,,1,nestling,"4/18: drone--pink paper 1 beside, 4/26: pink paper removed, 5/2: mercury done, chick BIG" +2022,jerrod,73,greg,2022-05-02,,1,nestling,"4/18: drone--pink paper 1 beside, 4/26: pink paper removed, 5/2: mercury done, chick BIG" +2022,jerrod,73,greg,2022-05-09,,1,nestling,"4/18: drone--pink paper 1 beside, 4/26: pink paper removed, 5/2: mercury done, chick BIG" +2022,jerrod,73,greg,2022-05-24,,,empty,"4/18: drone--pink paper 1 beside, 4/26: pink paper removed, 5/2: mercury done, chick BIG" +2022,jerrod,75,gbhe,2022-02-21,1,1,hatching,"3/28: chick big" +2022,jerrod,75,gbhe,2022-02-28,1,2,hatching,"3/28: chick big" +2022,jerrod,75,gbhe,2022-03-14,,1,nestling,"3/28: chick big" +2022,jerrod,75,gbhe,2022-03-21,,1,nestling,"3/28: chick big" +2022,jerrod,75,gbhe,2022-03-28,,1,nestling,"3/28: chick big" +2022,jerrod,75,gbhe,2022-04-05,,1,nestling,"3/28: chick big" +2022,jerrod,75,gbhe,2022-04-11,,1,nestling,"3/28: chick big" +2022,jerrod,75,gbhe,2022-04-18,,1,nestling,"3/28: chick big" +2022,jerrod,75,gbhe,2022-04-26,,1,nestling,"3/28: chick big" +2022,jerrod,75,gbhe,2022-05-02,,,empty,"3/28: chick big" +2022,jerrod,75,gbhe,2022-05-09,,,empty,"3/28: chick big" +2022,jerrod,75,gbhe,2022-05-24,,,empty,"3/28: chick big" +2022,jerrod,28,greg,2022-02-21,3,,incubating,"3/21: chicks likely 1 week old, 5/9: gone" +2022,jerrod,28,greg,2022-02-28,3,,incubating,"3/21: chicks likely 1 week old, 5/9: gone" +2022,jerrod,28,greg,2022-03-14,,,missed,"3/21: chicks likely 1 week old, 5/9: gone" +2022,jerrod,28,greg,2022-03-21,,2,nestling,"3/21: chicks likely 1 week old, 5/9: gone" +2022,jerrod,28,greg,2022-03-28,,2,nestling,"3/21: chicks likely 1 week old, 5/9: gone" +2022,jerrod,28,greg,2022-04-05,,2,nestling,"3/21: chicks likely 1 week old, 5/9: gone" +2022,jerrod,28,greg,2022-04-11,,2,nestling,"3/21: chicks likely 1 week old, 5/9: gone" +2022,jerrod,28,greg,2022-04-18,,2,nestling,"3/21: chicks likely 1 week old, 5/9: gone" +2022,jerrod,28,greg,2022-04-26,,2,nestling,"3/21: chicks likely 1 week old, 5/9: gone" +2022,jerrod,28,greg,2022-05-02,,,empty,"3/21: chicks likely 1 week old, 5/9: gone" +2022,jerrod,28,greg,2022-05-09,,,collapsed,"3/21: chicks likely 1 week old, 5/9: gone" +2022,jerrod,28,greg,2022-05-24,,,empty,"3/21: chicks likely 1 week old, 5/9: gone" +2022,jerrod,77,greg,2022-02-21,3,,incubating,"3/14: pulled" +2022,jerrod,77,greg,2022-02-28,1,,incubating,"3/14: pulled" +2022,jerrod,77,greg,2022-03-14,,,empty,"3/14: pulled" +2022,jerrod,77,greg,2022-03-21,,,,"3/14: pulled" +2022,jerrod,77,greg,2022-03-28,,,,"3/14: pulled" +2022,jerrod,77,greg,2022-04-05,,,,"3/14: pulled" +2022,jerrod,77,greg,2022-04-11,,,,"3/14: pulled" +2022,jerrod,77,greg,2022-04-18,,,,"3/14: pulled" +2022,jerrod,77,greg,2022-04-26,,,,"3/14: pulled" +2022,jerrod,77,greg,2022-05-02,,,,"3/14: pulled" +2022,jerrod,77,greg,2022-05-09,,,,"3/14: pulled" +2022,jerrod,77,greg,2022-05-24,,,,"3/14: pulled" +2022,jerrod,79,gbhe,2022-02-21,1,2,hatching,"3/28: second chick ejected and on ground, 4/26: nest gone, 5/2: gone, 5/9: gone, 5/24: gone" +2022,jerrod,79,gbhe,2022-02-28,,2,nestling,"3/28: second chick ejected and on ground, 4/26: nest gone, 5/2: gone, 5/9: gone, 5/24: gone" +2022,jerrod,79,gbhe,2022-03-14,,2,nestling,"3/28: second chick ejected and on ground, 4/26: nest gone, 5/2: gone, 5/9: gone, 5/24: gone" +2022,jerrod,79,gbhe,2022-03-21,,2,nestling,"3/28: second chick ejected and on ground, 4/26: nest gone, 5/2: gone, 5/9: gone, 5/24: gone" +2022,jerrod,79,gbhe,2022-03-28,,1,nestling,"3/28: second chick ejected and on ground, 4/26: nest gone, 5/2: gone, 5/9: gone, 5/24: gone" +2022,jerrod,79,gbhe,2022-04-05,,,empty,"3/28: second chick ejected and on ground, 4/26: nest gone, 5/2: gone, 5/9: gone, 5/24: gone" +2022,jerrod,79,gbhe,2022-04-11,,,empty,"3/28: second chick ejected and on ground, 4/26: nest gone, 5/2: gone, 5/9: gone, 5/24: gone" +2022,jerrod,79,gbhe,2022-04-18,,,empty,"3/28: second chick ejected and on ground, 4/26: nest gone, 5/2: gone, 5/9: gone, 5/24: gone" +2022,jerrod,79,gbhe,2022-04-26,,,empty,"3/28: second chick ejected and on ground, 4/26: nest gone, 5/2: gone, 5/9: gone, 5/24: gone" +2022,jerrod,79,gbhe,2022-05-02,,,collapsed,"3/28: second chick ejected and on ground, 4/26: nest gone, 5/2: gone, 5/9: gone, 5/24: gone" +2022,jerrod,79,gbhe,2022-05-09,,,collapsed,"3/28: second chick ejected and on ground, 4/26: nest gone, 5/2: gone, 5/9: gone, 5/24: gone" +2022,jerrod,79,gbhe,2022-05-24,,,collapsed,"3/28: second chick ejected and on ground, 4/26: nest gone, 5/2: gone, 5/9: gone, 5/24: gone" +2022,jerrod,163,greg,2022-02-21,,,,"After 75. 4/18: drone--blue paper in 9, 4/26: nest gone, blue paper removed,5/2: gone, 5/9: gone, 5/24: gone" +2022,jerrod,163,greg,2022-02-28,,,,"After 75. 4/18: drone--blue paper in 9, 4/26: nest gone, blue paper removed,5/2: gone, 5/9: gone, 5/24: gone" +2022,jerrod,163,greg,2022-03-14,3,,incubating,"After 75. 4/18: drone--blue paper in 9, 4/26: nest gone, blue paper removed,5/2: gone, 5/9: gone, 5/24: gone" +2022,jerrod,163,greg,2022-03-21,3,,incubating,"After 75. 4/18: drone--blue paper in 9, 4/26: nest gone, blue paper removed,5/2: gone, 5/9: gone, 5/24: gone" +2022,jerrod,163,greg,2022-03-28,,,empty,"After 75. 4/18: drone--blue paper in 9, 4/26: nest gone, blue paper removed,5/2: gone, 5/9: gone, 5/24: gone" +2022,jerrod,163,greg,2022-04-05,,,empty,"After 75. 4/18: drone--blue paper in 9, 4/26: nest gone, blue paper removed,5/2: gone, 5/9: gone, 5/24: gone" +2022,jerrod,163,greg,2022-04-11,,,empty,"After 75. 4/18: drone--blue paper in 9, 4/26: nest gone, blue paper removed,5/2: gone, 5/9: gone, 5/24: gone" +2022,jerrod,163,greg,2022-04-18,,,empty,"After 75. 4/18: drone--blue paper in 9, 4/26: nest gone, blue paper removed,5/2: gone, 5/9: gone, 5/24: gone" +2022,jerrod,163,greg,2022-04-26,,,empty,"After 75. 4/18: drone--blue paper in 9, 4/26: nest gone, blue paper removed,5/2: gone, 5/9: gone, 5/24: gone" +2022,jerrod,163,greg,2022-05-02,,,collapsed,"After 75. 4/18: drone--blue paper in 9, 4/26: nest gone, blue paper removed,5/2: gone, 5/9: gone, 5/24: gone" +2022,jerrod,163,greg,2022-05-09,,,collapsed,"After 75. 4/18: drone--blue paper in 9, 4/26: nest gone, blue paper removed,5/2: gone, 5/9: gone, 5/24: gone" +2022,jerrod,163,greg,2022-05-24,,,,"After 75. 4/18: drone--blue paper in 9, 4/26: nest gone, blue paper removed,5/2: gone, 5/9: gone, 5/24: gone" +2022,jerrod,81,greg,2022-02-21,1,,incubating,"3/21: chicks dry and small, 4/18: mercury sampled, 5/2: maybe 1+ chicks, heard movement, 5/24: lots of yellow paper" +2022,jerrod,81,greg,2022-02-28,2,,incubating,"3/21: chicks dry and small, 4/18: mercury sampled, 5/2: maybe 1+ chicks, heard movement, 5/24: lots of yellow paper" +2022,jerrod,81,greg,2022-03-14,2,,incubating,"3/21: chicks dry and small, 4/18: mercury sampled, 5/2: maybe 1+ chicks, heard movement, 5/24: lots of yellow paper" +2022,jerrod,81,greg,2022-03-21,,2,nestling,"3/21: chicks dry and small, 4/18: mercury sampled, 5/2: maybe 1+ chicks, heard movement, 5/24: lots of yellow paper" +2022,jerrod,81,greg,2022-03-28,,2,nestling,"3/21: chicks dry and small, 4/18: mercury sampled, 5/2: maybe 1+ chicks, heard movement, 5/24: lots of yellow paper" +2022,jerrod,81,greg,2022-04-05,,2,nestling,"3/21: chicks dry and small, 4/18: mercury sampled, 5/2: maybe 1+ chicks, heard movement, 5/24: lots of yellow paper" +2022,jerrod,81,greg,2022-04-11,,2,nestling,"3/21: chicks dry and small, 4/18: mercury sampled, 5/2: maybe 1+ chicks, heard movement, 5/24: lots of yellow paper" +2022,jerrod,81,greg,2022-04-18,,2,nestling,"3/21: chicks dry and small, 4/18: mercury sampled, 5/2: maybe 1+ chicks, heard movement, 5/24: lots of yellow paper" +2022,jerrod,81,greg,2022-04-26,,,missed,"3/21: chicks dry and small, 4/18: mercury sampled, 5/2: maybe 1+ chicks, heard movement, 5/24: lots of yellow paper" +2022,jerrod,81,greg,2022-05-02,,,empty,"3/21: chicks dry and small, 4/18: mercury sampled, 5/2: maybe 1+ chicks, heard movement, 5/24: lots of yellow paper" +2022,jerrod,81,greg,2022-05-09,,,empty,"3/21: chicks dry and small, 4/18: mercury sampled, 5/2: maybe 1+ chicks, heard movement, 5/24: lots of yellow paper" +2022,jerrod,81,greg,2022-05-24,,,collapsed,"3/21: chicks dry and small, 4/18: mercury sampled, 5/2: maybe 1+ chicks, heard movement, 5/24: lots of yellow paper" +2022,jerrod,30,gbhe,2022-02-21,3,,incubating,"3/28: big chicks, 5/2: chick BIG!!, 5/9: 2c definitely, 5/24: 1c+" +2022,jerrod,30,gbhe,2022-02-28,3,,incubating,"3/28: big chicks, 5/2: chick BIG!!, 5/9: 2c definitely, 5/24: 1c+" +2022,jerrod,30,gbhe,2022-03-14,2,1,hatching,"3/28: big chicks, 5/2: chick BIG!!, 5/9: 2c definitely, 5/24: 1c+" +2022,jerrod,30,gbhe,2022-03-21,1,2,hatching,"3/28: big chicks, 5/2: chick BIG!!, 5/9: 2c definitely, 5/24: 1c+" +2022,jerrod,30,gbhe,2022-03-28,,2,nestling,"3/28: big chicks, 5/2: chick BIG!!, 5/9: 2c definitely, 5/24: 1c+" +2022,jerrod,30,gbhe,2022-04-05,,1,nestling,"3/28: big chicks, 5/2: chick BIG!!, 5/9: 2c definitely, 5/24: 1c+" +2022,jerrod,30,gbhe,2022-04-11,,1,nestling,"3/28: big chicks, 5/2: chick BIG!!, 5/9: 2c definitely, 5/24: 1c+" +2022,jerrod,30,gbhe,2022-04-18,,1,nestling,"3/28: big chicks, 5/2: chick BIG!!, 5/9: 2c definitely, 5/24: 1c+" +2022,jerrod,30,gbhe,2022-04-26,,1,nestling,"3/28: big chicks, 5/2: chick BIG!!, 5/9: 2c definitely, 5/24: 1c+" +2022,jerrod,30,gbhe,2022-05-02,,1,nestling,"3/28: big chicks, 5/2: chick BIG!!, 5/9: 2c definitely, 5/24: 1c+" +2022,jerrod,30,gbhe,2022-05-09,,2,nestling,"3/28: big chicks, 5/2: chick BIG!!, 5/9: 2c definitely, 5/24: 1c+" +2022,jerrod,30,gbhe,2022-05-24,,1,nestling,"3/28: big chicks, 5/2: chick BIG!!, 5/9: 2c definitely, 5/24: 1c+" +2022,jerrod,159,greg,2022-02-21,,,,"Off transect from 75. 4/18: nest gone, drone--orange paper 3, 4/26: orange paper removed, 5/2: gone, 5/9: gone" +2022,jerrod,159,greg,2022-02-28,,,,"Off transect from 75. 4/18: nest gone, drone--orange paper 3, 4/26: orange paper removed, 5/2: gone, 5/9: gone" +2022,jerrod,159,greg,2022-03-14,3,,incubating,"Off transect from 75. 4/18: nest gone, drone--orange paper 3, 4/26: orange paper removed, 5/2: gone, 5/9: gone" +2022,jerrod,159,greg,2022-03-21,3,,incubating,"Off transect from 75. 4/18: nest gone, drone--orange paper 3, 4/26: orange paper removed, 5/2: gone, 5/9: gone" +2022,jerrod,159,greg,2022-03-28,,,empty,"Off transect from 75. 4/18: nest gone, drone--orange paper 3, 4/26: orange paper removed, 5/2: gone, 5/9: gone" +2022,jerrod,159,greg,2022-04-05,,,empty,"Off transect from 75. 4/18: nest gone, drone--orange paper 3, 4/26: orange paper removed, 5/2: gone, 5/9: gone" +2022,jerrod,159,greg,2022-04-11,,,empty,"Off transect from 75. 4/18: nest gone, drone--orange paper 3, 4/26: orange paper removed, 5/2: gone, 5/9: gone" +2022,jerrod,159,greg,2022-04-18,,,empty,"Off transect from 75. 4/18: nest gone, drone--orange paper 3, 4/26: orange paper removed, 5/2: gone, 5/9: gone" +2022,jerrod,159,greg,2022-04-26,,,empty,"Off transect from 75. 4/18: nest gone, drone--orange paper 3, 4/26: orange paper removed, 5/2: gone, 5/9: gone" +2022,jerrod,159,greg,2022-05-02,,,collapsed,"Off transect from 75. 4/18: nest gone, drone--orange paper 3, 4/26: orange paper removed, 5/2: gone, 5/9: gone" +2022,jerrod,159,greg,2022-05-09,,,collapsed,"Off transect from 75. 4/18: nest gone, drone--orange paper 3, 4/26: orange paper removed, 5/2: gone, 5/9: gone" +2022,jerrod,159,greg,2022-05-24,,,missed,"Off transect from 75. 4/18: nest gone, drone--orange paper 3, 4/26: orange paper removed, 5/2: gone, 5/9: gone" +2022,jerrod,161,greg,2022-02-21,,,,"Off transect from 75. 4/18: nest gone, drone--yellow paper 4, 4/26: yellow paper removed, 5/2: gone, 5/9: gone, 5/24: gone" +2022,jerrod,161,greg,2022-02-28,,,,"Off transect from 75. 4/18: nest gone, drone--yellow paper 4, 4/26: yellow paper removed, 5/2: gone, 5/9: gone, 5/24: gone" +2022,jerrod,161,greg,2022-03-14,3,,incubating,"Off transect from 75. 4/18: nest gone, drone--yellow paper 4, 4/26: yellow paper removed, 5/2: gone, 5/9: gone, 5/24: gone" +2022,jerrod,161,greg,2022-03-21,3,,incubating,"Off transect from 75. 4/18: nest gone, drone--yellow paper 4, 4/26: yellow paper removed, 5/2: gone, 5/9: gone, 5/24: gone" +2022,jerrod,161,greg,2022-03-28,,,empty,"Off transect from 75. 4/18: nest gone, drone--yellow paper 4, 4/26: yellow paper removed, 5/2: gone, 5/9: gone, 5/24: gone" +2022,jerrod,161,greg,2022-04-05,,,empty,"Off transect from 75. 4/18: nest gone, drone--yellow paper 4, 4/26: yellow paper removed, 5/2: gone, 5/9: gone, 5/24: gone" +2022,jerrod,161,greg,2022-04-11,,,empty,"Off transect from 75. 4/18: nest gone, drone--yellow paper 4, 4/26: yellow paper removed, 5/2: gone, 5/9: gone, 5/24: gone" +2022,jerrod,161,greg,2022-04-18,,,empty,"Off transect from 75. 4/18: nest gone, drone--yellow paper 4, 4/26: yellow paper removed, 5/2: gone, 5/9: gone, 5/24: gone" +2022,jerrod,161,greg,2022-04-26,,,empty,"Off transect from 75. 4/18: nest gone, drone--yellow paper 4, 4/26: yellow paper removed, 5/2: gone, 5/9: gone, 5/24: gone" +2022,jerrod,161,greg,2022-05-02,,,collapsed,"Off transect from 75. 4/18: nest gone, drone--yellow paper 4, 4/26: yellow paper removed, 5/2: gone, 5/9: gone, 5/24: gone" +2022,jerrod,161,greg,2022-05-09,,,collapsed,"Off transect from 75. 4/18: nest gone, drone--yellow paper 4, 4/26: yellow paper removed, 5/2: gone, 5/9: gone, 5/24: gone" +2022,jerrod,161,greg,2022-05-24,,,collapsed,"Off transect from 75. 4/18: nest gone, drone--yellow paper 4, 4/26: yellow paper removed, 5/2: gone, 5/9: gone, 5/24: gone" +2022,jerrod,167,greg,2022-02-21,,,,"After 163. 3/21: 1 egg depredated, 4/18: drone--orange paper in 10, 4/26: orange paper removed, 5/2: gone, 5/9: gone, 5/24: gone" +2022,jerrod,167,greg,2022-02-28,,,,"After 163. 3/21: 1 egg depredated, 4/18: drone--orange paper in 10, 4/26: orange paper removed, 5/2: gone, 5/9: gone, 5/24: gone" +2022,jerrod,167,greg,2022-03-14,2,,incubating,"After 163. 3/21: 1 egg depredated, 4/18: drone--orange paper in 10, 4/26: orange paper removed, 5/2: gone, 5/9: gone, 5/24: gone" +2022,jerrod,167,greg,2022-03-21,1,,incubating,"After 163. 3/21: 1 egg depredated, 4/18: drone--orange paper in 10, 4/26: orange paper removed, 5/2: gone, 5/9: gone, 5/24: gone" +2022,jerrod,167,greg,2022-03-28,,,empty,"After 163. 3/21: 1 egg depredated, 4/18: drone--orange paper in 10, 4/26: orange paper removed, 5/2: gone, 5/9: gone, 5/24: gone" +2022,jerrod,167,greg,2022-04-05,,,empty,"After 163. 3/21: 1 egg depredated, 4/18: drone--orange paper in 10, 4/26: orange paper removed, 5/2: gone, 5/9: gone, 5/24: gone" +2022,jerrod,167,greg,2022-04-11,,,empty,"After 163. 3/21: 1 egg depredated, 4/18: drone--orange paper in 10, 4/26: orange paper removed, 5/2: gone, 5/9: gone, 5/24: gone" +2022,jerrod,167,greg,2022-04-18,,,empty,"After 163. 3/21: 1 egg depredated, 4/18: drone--orange paper in 10, 4/26: orange paper removed, 5/2: gone, 5/9: gone, 5/24: gone" +2022,jerrod,167,greg,2022-04-26,,,empty,"After 163. 3/21: 1 egg depredated, 4/18: drone--orange paper in 10, 4/26: orange paper removed, 5/2: gone, 5/9: gone, 5/24: gone" +2022,jerrod,167,greg,2022-05-02,,,collapsed,"After 163. 3/21: 1 egg depredated, 4/18: drone--orange paper in 10, 4/26: orange paper removed, 5/2: gone, 5/9: gone, 5/24: gone" +2022,jerrod,167,greg,2022-05-09,,,collapsed,"After 163. 3/21: 1 egg depredated, 4/18: drone--orange paper in 10, 4/26: orange paper removed, 5/2: gone, 5/9: gone, 5/24: gone" +2022,jerrod,167,greg,2022-05-24,,,collapsed,"After 163. 3/21: 1 egg depredated, 4/18: drone--orange paper in 10, 4/26: orange paper removed, 5/2: gone, 5/9: gone, 5/24: gone" +2022,jerrod,169,greg,2022-02-21,,,,"Near 79. 4/11: certain on number of chicks, 5/2: mercury done, 5/9: one chick in tree adjacent, 5/24: orange paper" +2022,jerrod,169,greg,2022-02-28,,,,"Near 79. 4/11: certain on number of chicks, 5/2: mercury done, 5/9: one chick in tree adjacent, 5/24: orange paper" +2022,jerrod,169,greg,2022-03-14,3,,incubating,"Near 79. 4/11: certain on number of chicks, 5/2: mercury done, 5/9: one chick in tree adjacent, 5/24: orange paper" +2022,jerrod,169,greg,2022-03-21,3,,incubating,"Near 79. 4/11: certain on number of chicks, 5/2: mercury done, 5/9: one chick in tree adjacent, 5/24: orange paper" +2022,jerrod,169,greg,2022-03-28,3,,incubating,"Near 79. 4/11: certain on number of chicks, 5/2: mercury done, 5/9: one chick in tree adjacent, 5/24: orange paper" +2022,jerrod,169,greg,2022-04-05,1,1,hatching,"Near 79. 4/11: certain on number of chicks, 5/2: mercury done, 5/9: one chick in tree adjacent, 5/24: orange paper" +2022,jerrod,169,greg,2022-04-11,,3,nestling,"Near 79. 4/11: certain on number of chicks, 5/2: mercury done, 5/9: one chick in tree adjacent, 5/24: orange paper" +2022,jerrod,169,greg,2022-04-18,,3,nestling,"Near 79. 4/11: certain on number of chicks, 5/2: mercury done, 5/9: one chick in tree adjacent, 5/24: orange paper" +2022,jerrod,169,greg,2022-04-26,,,missed,"Near 79. 4/11: certain on number of chicks, 5/2: mercury done, 5/9: one chick in tree adjacent, 5/24: orange paper" +2022,jerrod,169,greg,2022-05-02,,3,nestling,"Near 79. 4/11: certain on number of chicks, 5/2: mercury done, 5/9: one chick in tree adjacent, 5/24: orange paper" +2022,jerrod,169,greg,2022-05-09,,,empty,"Near 79. 4/11: certain on number of chicks, 5/2: mercury done, 5/9: one chick in tree adjacent, 5/24: orange paper" +2022,jerrod,169,greg,2022-05-24,,,empty,"Near 79. 4/11: certain on number of chicks, 5/2: mercury done, 5/9: one chick in tree adjacent, 5/24: orange paper" +2022,jerrod,165,greg,2022-02-21,,,,"After 169. 4/26: nest gone, 5/9: gone, 5/24: gone" +2022,jerrod,165,greg,2022-02-28,,,,"After 169. 4/26: nest gone, 5/9: gone, 5/24: gone" +2022,jerrod,165,greg,2022-03-14,2,,incubating,"After 169. 4/26: nest gone, 5/9: gone, 5/24: gone" +2022,jerrod,165,greg,2022-03-21,2,,incubating,"After 169. 4/26: nest gone, 5/9: gone, 5/24: gone" +2022,jerrod,165,greg,2022-03-28,2,,incubating,"After 169. 4/26: nest gone, 5/9: gone, 5/24: gone" +2022,jerrod,165,greg,2022-04-05,,,empty,"After 169. 4/26: nest gone, 5/9: gone, 5/24: gone" +2022,jerrod,165,greg,2022-04-11,,,empty,"After 169. 4/26: nest gone, 5/9: gone, 5/24: gone" +2022,jerrod,165,greg,2022-04-18,,,empty,"After 169. 4/26: nest gone, 5/9: gone, 5/24: gone" +2022,jerrod,165,greg,2022-04-26,,,empty,"After 169. 4/26: nest gone, 5/9: gone, 5/24: gone" +2022,jerrod,165,greg,2022-05-02,,,missed,"After 169. 4/26: nest gone, 5/9: gone, 5/24: gone" +2022,jerrod,165,greg,2022-05-09,,,collapsed,"After 169. 4/26: nest gone, 5/9: gone, 5/24: gone" +2022,jerrod,165,greg,2022-05-24,,,collapsed,"After 169. 4/26: nest gone, 5/9: gone, 5/24: gone" +2022,jerrod,171,greg,2022-02-21,,,,"5/24: gone/MT, yellow paper and green" +2022,jerrod,171,greg,2022-02-28,,,,"5/24: gone/MT, yellow paper and green" +2022,jerrod,171,greg,2022-03-14,2,,incubating,"5/24: gone/MT, yellow paper and green" +2022,jerrod,171,greg,2022-03-21,2,,incubating,"5/24: gone/MT, yellow paper and green" +2022,jerrod,171,greg,2022-03-28,,,empty,"5/24: gone/MT, yellow paper and green" +2022,jerrod,171,greg,2022-04-05,,,empty,"5/24: gone/MT, yellow paper and green" +2022,jerrod,171,greg,2022-04-11,,,empty,"5/24: gone/MT, yellow paper and green" +2022,jerrod,171,greg,2022-04-18,,,empty,"5/24: gone/MT, yellow paper and green" +2022,jerrod,171,greg,2022-04-26,,,empty,"5/24: gone/MT, yellow paper and green" +2022,jerrod,171,greg,2022-05-02,,,missed,"5/24: gone/MT, yellow paper and green" +2022,jerrod,171,greg,2022-05-09,,,missed,"5/24: gone/MT, yellow paper and green" +2022,jerrod,171,greg,2022-05-24,,,collapsed,"5/24: gone/MT, yellow paper and green" +2022,jerrod,283b,greg,2022-02-21,,,,"Near 69." +2022,jerrod,283b,greg,2022-02-28,,,,"Near 69." +2022,jerrod,283b,greg,2022-03-14,,,,"Near 69." +2022,jerrod,283b,greg,2022-03-21,3,,incubating,"Near 69." +2022,jerrod,283b,greg,2022-03-28,,,empty,"Near 69." +2022,jerrod,283b,greg,2022-04-05,,,empty,"Near 69." +2022,jerrod,283b,greg,2022-04-11,,,empty,"Near 69." +2022,jerrod,283b,greg,2022-04-18,,,missed,"Near 69." +2022,jerrod,283b,greg,2022-04-26,,,missed,"Near 69." +2022,jerrod,283b,greg,2022-05-02,,,missed,"Near 69." +2022,jerrod,283b,greg,2022-05-09,,,missed,"Near 69." +2022,jerrod,283b,greg,2022-05-24,,,missed,"Near 69." +2022,jerrod,285,greg,2022-02-21,,,,"South of double blue flagging. 3/28: collapsed, pulled" +2022,jerrod,285,greg,2022-02-28,,,,"South of double blue flagging. 3/28: collapsed, pulled" +2022,jerrod,285,greg,2022-03-14,,,,"South of double blue flagging. 3/28: collapsed, pulled" +2022,jerrod,285,greg,2022-03-21,1,,incubating,"South of double blue flagging. 3/28: collapsed, pulled" +2022,jerrod,285,greg,2022-03-28,,,,"South of double blue flagging. 3/28: collapsed, pulled" +2022,jerrod,285,greg,2022-04-05,,,,"South of double blue flagging. 3/28: collapsed, pulled" +2022,jerrod,285,greg,2022-04-11,,,,"South of double blue flagging. 3/28: collapsed, pulled" +2022,jerrod,285,greg,2022-04-18,,,,"South of double blue flagging. 3/28: collapsed, pulled" +2022,jerrod,285,greg,2022-04-26,,,,"South of double blue flagging. 3/28: collapsed, pulled" +2022,jerrod,285,greg,2022-05-02,,,,"South of double blue flagging. 3/28: collapsed, pulled" +2022,jerrod,285,greg,2022-05-09,,,,"South of double blue flagging. 3/28: collapsed, pulled" +2022,jerrod,285,greg,2022-05-24,,,,"South of double blue flagging. 3/28: collapsed, pulled" +2022,jerrod,287,greg,2022-02-21,,,,"South of double blue flagging. 5/2: chicks BIG, mercury done, 5/9: branchling size, 5/24: pink paper 3ft away" +2022,jerrod,287,greg,2022-02-28,,,,"South of double blue flagging. 5/2: chicks BIG, mercury done, 5/9: branchling size, 5/24: pink paper 3ft away" +2022,jerrod,287,greg,2022-03-14,,,,"South of double blue flagging. 5/2: chicks BIG, mercury done, 5/9: branchling size, 5/24: pink paper 3ft away" +2022,jerrod,287,greg,2022-03-21,2,,incubating,"South of double blue flagging. 5/2: chicks BIG, mercury done, 5/9: branchling size, 5/24: pink paper 3ft away" +2022,jerrod,287,greg,2022-03-28,2,,incubating,"South of double blue flagging. 5/2: chicks BIG, mercury done, 5/9: branchling size, 5/24: pink paper 3ft away" +2022,jerrod,287,greg,2022-04-05,,2,nestling,"South of double blue flagging. 5/2: chicks BIG, mercury done, 5/9: branchling size, 5/24: pink paper 3ft away" +2022,jerrod,287,greg,2022-04-11,,2,nestling,"South of double blue flagging. 5/2: chicks BIG, mercury done, 5/9: branchling size, 5/24: pink paper 3ft away" +2022,jerrod,287,greg,2022-04-18,,2,nestling,"South of double blue flagging. 5/2: chicks BIG, mercury done, 5/9: branchling size, 5/24: pink paper 3ft away" +2022,jerrod,287,greg,2022-04-26,,2,nestling,"South of double blue flagging. 5/2: chicks BIG, mercury done, 5/9: branchling size, 5/24: pink paper 3ft away" +2022,jerrod,287,greg,2022-05-02,,2,nestling,"South of double blue flagging. 5/2: chicks BIG, mercury done, 5/9: branchling size, 5/24: pink paper 3ft away" +2022,jerrod,287,greg,2022-05-09,,2,nestling,"South of double blue flagging. 5/2: chicks BIG, mercury done, 5/9: branchling size, 5/24: pink paper 3ft away" +2022,jerrod,287,greg,2022-05-24,,,empty,"South of double blue flagging. 5/2: chicks BIG, mercury done, 5/9: branchling size, 5/24: pink paper 3ft away" +2022,jerrod,289,greg,2022-02-21,,,,"On top of fern. 4/11: drone--3 blue flagging, 4/18: removed blue, 5/2: collapsed, 5/9: gone, 5/24: gone" +2022,jerrod,289,greg,2022-02-28,,,,"On top of fern. 4/11: drone--3 blue flagging, 4/18: removed blue, 5/2: collapsed, 5/9: gone, 5/24: gone" +2022,jerrod,289,greg,2022-03-14,,,,"On top of fern. 4/11: drone--3 blue flagging, 4/18: removed blue, 5/2: collapsed, 5/9: gone, 5/24: gone" +2022,jerrod,289,greg,2022-03-21,3,,incubating,"On top of fern. 4/11: drone--3 blue flagging, 4/18: removed blue, 5/2: collapsed, 5/9: gone, 5/24: gone" +2022,jerrod,289,greg,2022-03-28,3,,incubating,"On top of fern. 4/11: drone--3 blue flagging, 4/18: removed blue, 5/2: collapsed, 5/9: gone, 5/24: gone" +2022,jerrod,289,greg,2022-04-05,,,empty,"On top of fern. 4/11: drone--3 blue flagging, 4/18: removed blue, 5/2: collapsed, 5/9: gone, 5/24: gone" +2022,jerrod,289,greg,2022-04-11,,,empty,"On top of fern. 4/11: drone--3 blue flagging, 4/18: removed blue, 5/2: collapsed, 5/9: gone, 5/24: gone" +2022,jerrod,289,greg,2022-04-18,,,empty,"On top of fern. 4/11: drone--3 blue flagging, 4/18: removed blue, 5/2: collapsed, 5/9: gone, 5/24: gone" +2022,jerrod,289,greg,2022-04-26,,,empty,"On top of fern. 4/11: drone--3 blue flagging, 4/18: removed blue, 5/2: collapsed, 5/9: gone, 5/24: gone" +2022,jerrod,289,greg,2022-05-02,,,empty,"On top of fern. 4/11: drone--3 blue flagging, 4/18: removed blue, 5/2: collapsed, 5/9: gone, 5/24: gone" +2022,jerrod,289,greg,2022-05-09,,,collapsed,"On top of fern. 4/11: drone--3 blue flagging, 4/18: removed blue, 5/2: collapsed, 5/9: gone, 5/24: gone" +2022,jerrod,289,greg,2022-05-24,,,collapsed,"On top of fern. 4/11: drone--3 blue flagging, 4/18: removed blue, 5/2: collapsed, 5/9: gone, 5/24: gone" +2022,jerrod,291,greg,2022-02-21,,,,"3/21: chick wet, 5/2: 1+C big, 5/9: 1+c, 5/24: pink paper" +2022,jerrod,291,greg,2022-02-28,,,,"3/21: chick wet, 5/2: 1+C big, 5/9: 1+c, 5/24: pink paper" +2022,jerrod,291,greg,2022-03-14,,,,"3/21: chick wet, 5/2: 1+C big, 5/9: 1+c, 5/24: pink paper" +2022,jerrod,291,greg,2022-03-21,3,1,wet_chick,"3/21: chick wet, 5/2: 1+C big, 5/9: 1+c, 5/24: pink paper" +2022,jerrod,291,greg,2022-03-28,,3,nestling,"3/21: chick wet, 5/2: 1+C big, 5/9: 1+c, 5/24: pink paper" +2022,jerrod,291,greg,2022-04-05,,2,nestling,"3/21: chick wet, 5/2: 1+C big, 5/9: 1+c, 5/24: pink paper" +2022,jerrod,291,greg,2022-04-11,,2,nestling,"3/21: chick wet, 5/2: 1+C big, 5/9: 1+c, 5/24: pink paper" +2022,jerrod,291,greg,2022-04-18,,2,nestling,"3/21: chick wet, 5/2: 1+C big, 5/9: 1+c, 5/24: pink paper" +2022,jerrod,291,greg,2022-04-26,,2,nestling,"3/21: chick wet, 5/2: 1+C big, 5/9: 1+c, 5/24: pink paper" +2022,jerrod,291,greg,2022-05-02,,1,nestling,"3/21: chick wet, 5/2: 1+C big, 5/9: 1+c, 5/24: pink paper" +2022,jerrod,291,greg,2022-05-09,,1,nestling,"3/21: chick wet, 5/2: 1+C big, 5/9: 1+c, 5/24: pink paper" +2022,jerrod,291,greg,2022-05-24,,,empty,"3/21: chick wet, 5/2: 1+C big, 5/9: 1+c, 5/24: pink paper" +2022,jerrod,293,greg,2022-02-21,,,,"Last one before 73, near 75. 4/18: gone, drone--pink paper in it 5, 4/26: pink paper removed, 5/2: gone, 5/24: gone" +2022,jerrod,293,greg,2022-02-28,,,,"Last one before 73, near 75. 4/18: gone, drone--pink paper in it 5, 4/26: pink paper removed, 5/2: gone, 5/24: gone" +2022,jerrod,293,greg,2022-03-14,,,,"Last one before 73, near 75. 4/18: gone, drone--pink paper in it 5, 4/26: pink paper removed, 5/2: gone, 5/24: gone" +2022,jerrod,293,greg,2022-03-21,2,,incubating,"Last one before 73, near 75. 4/18: gone, drone--pink paper in it 5, 4/26: pink paper removed, 5/2: gone, 5/24: gone" +2022,jerrod,293,greg,2022-03-28,2,,incubating,"Last one before 73, near 75. 4/18: gone, drone--pink paper in it 5, 4/26: pink paper removed, 5/2: gone, 5/24: gone" +2022,jerrod,293,greg,2022-04-05,,,empty,"Last one before 73, near 75. 4/18: gone, drone--pink paper in it 5, 4/26: pink paper removed, 5/2: gone, 5/24: gone" +2022,jerrod,293,greg,2022-04-11,,,empty,"Last one before 73, near 75. 4/18: gone, drone--pink paper in it 5, 4/26: pink paper removed, 5/2: gone, 5/24: gone" +2022,jerrod,293,greg,2022-04-18,,,empty,"Last one before 73, near 75. 4/18: gone, drone--pink paper in it 5, 4/26: pink paper removed, 5/2: gone, 5/24: gone" +2022,jerrod,293,greg,2022-04-26,,,empty,"Last one before 73, near 75. 4/18: gone, drone--pink paper in it 5, 4/26: pink paper removed, 5/2: gone, 5/24: gone" +2022,jerrod,293,greg,2022-05-02,,,collapsed,"Last one before 73, near 75. 4/18: gone, drone--pink paper in it 5, 4/26: pink paper removed, 5/2: gone, 5/24: gone" +2022,jerrod,293,greg,2022-05-09,,,empty,"Last one before 73, near 75. 4/18: gone, drone--pink paper in it 5, 4/26: pink paper removed, 5/2: gone, 5/24: gone" +2022,jerrod,293,greg,2022-05-24,,,collapsed,"Last one before 73, near 75. 4/18: gone, drone--pink paper in it 5, 4/26: pink paper removed, 5/2: gone, 5/24: gone" +2022,jerrod,102,greg,2022-02-21,,,,"Near 75. 3/21: dry, approx 1 week old, 4/18: drone--blue paper 6, 4/26: blue paper removed, 5/2: gone, 5/9: gone" +2022,jerrod,102,greg,2022-02-28,,,,"Near 75. 3/21: dry, approx 1 week old, 4/18: drone--blue paper 6, 4/26: blue paper removed, 5/2: gone, 5/9: gone" +2022,jerrod,102,greg,2022-03-14,,,,"Near 75. 3/21: dry, approx 1 week old, 4/18: drone--blue paper 6, 4/26: blue paper removed, 5/2: gone, 5/9: gone" +2022,jerrod,102,greg,2022-03-21,,2,nestling,"Near 75. 3/21: dry, approx 1 week old, 4/18: drone--blue paper 6, 4/26: blue paper removed, 5/2: gone, 5/9: gone" +2022,jerrod,102,greg,2022-03-28,,2,nestling,"Near 75. 3/21: dry, approx 1 week old, 4/18: drone--blue paper 6, 4/26: blue paper removed, 5/2: gone, 5/9: gone" +2022,jerrod,102,greg,2022-04-05,,,empty,"Near 75. 3/21: dry, approx 1 week old, 4/18: drone--blue paper 6, 4/26: blue paper removed, 5/2: gone, 5/9: gone" +2022,jerrod,102,greg,2022-04-11,,,empty,"Near 75. 3/21: dry, approx 1 week old, 4/18: drone--blue paper 6, 4/26: blue paper removed, 5/2: gone, 5/9: gone" +2022,jerrod,102,greg,2022-04-18,,,empty,"Near 75. 3/21: dry, approx 1 week old, 4/18: drone--blue paper 6, 4/26: blue paper removed, 5/2: gone, 5/9: gone" +2022,jerrod,102,greg,2022-04-26,,,empty,"Near 75. 3/21: dry, approx 1 week old, 4/18: drone--blue paper 6, 4/26: blue paper removed, 5/2: gone, 5/9: gone" +2022,jerrod,102,greg,2022-05-02,,,collapsed,"Near 75. 3/21: dry, approx 1 week old, 4/18: drone--blue paper 6, 4/26: blue paper removed, 5/2: gone, 5/9: gone" +2022,jerrod,102,greg,2022-05-09,,,collapsed,"Near 75. 3/21: dry, approx 1 week old, 4/18: drone--blue paper 6, 4/26: blue paper removed, 5/2: gone, 5/9: gone" +2022,jerrod,102,greg,2022-05-24,,,collapsed,"Near 75. 3/21: dry, approx 1 week old, 4/18: drone--blue paper 6, 4/26: blue paper removed, 5/2: gone, 5/9: gone" +2022,jerrod,295,greg,2022-02-21,,,,"Before 79, set back farther than it looks. 5/2: gone, 5/9: gone, 5/24: orange paper near" +2022,jerrod,295,greg,2022-02-28,,,,"Before 79, set back farther than it looks. 5/2: gone, 5/9: gone, 5/24: orange paper near" +2022,jerrod,295,greg,2022-03-14,,,,"Before 79, set back farther than it looks. 5/2: gone, 5/9: gone, 5/24: orange paper near" +2022,jerrod,295,greg,2022-03-21,3,,incubating,"Before 79, set back farther than it looks. 5/2: gone, 5/9: gone, 5/24: orange paper near" +2022,jerrod,295,greg,2022-03-28,3,,incubating,"Before 79, set back farther than it looks. 5/2: gone, 5/9: gone, 5/24: orange paper near" +2022,jerrod,295,greg,2022-04-05,1,1,hatching,"Before 79, set back farther than it looks. 5/2: gone, 5/9: gone, 5/24: orange paper near" +2022,jerrod,295,greg,2022-04-11,,,empty,"Before 79, set back farther than it looks. 5/2: gone, 5/9: gone, 5/24: orange paper near" +2022,jerrod,295,greg,2022-04-18,,,empty,"Before 79, set back farther than it looks. 5/2: gone, 5/9: gone, 5/24: orange paper near" +2022,jerrod,295,greg,2022-04-26,,,empty,"Before 79, set back farther than it looks. 5/2: gone, 5/9: gone, 5/24: orange paper near" +2022,jerrod,295,greg,2022-05-02,,,collapsed,"Before 79, set back farther than it looks. 5/2: gone, 5/9: gone, 5/24: orange paper near" +2022,jerrod,295,greg,2022-05-09,,,collapsed,"Before 79, set back farther than it looks. 5/2: gone, 5/9: gone, 5/24: orange paper near" +2022,jerrod,295,greg,2022-05-24,,,collapsed,"Before 79, set back farther than it looks. 5/2: gone, 5/9: gone, 5/24: orange paper near" +2022,jerrod,297,greg,2022-02-21,,,,"Before 79, on top of vines. 4/5: collapsed, 4/18: gone, drone--orange paper beside 8, 4/26: yellow paper removed, 5/2: gone, 5/9: gone, 5/24: gone" +2022,jerrod,297,greg,2022-02-28,,,,"Before 79, on top of vines. 4/5: collapsed, 4/18: gone, drone--orange paper beside 8, 4/26: yellow paper removed, 5/2: gone, 5/9: gone, 5/24: gone" +2022,jerrod,297,greg,2022-03-14,,,,"Before 79, on top of vines. 4/5: collapsed, 4/18: gone, drone--orange paper beside 8, 4/26: yellow paper removed, 5/2: gone, 5/9: gone, 5/24: gone" +2022,jerrod,297,greg,2022-03-21,2,,incubating,"Before 79, on top of vines. 4/5: collapsed, 4/18: gone, drone--orange paper beside 8, 4/26: yellow paper removed, 5/2: gone, 5/9: gone, 5/24: gone" +2022,jerrod,297,greg,2022-03-28,2,,incubating,"Before 79, on top of vines. 4/5: collapsed, 4/18: gone, drone--orange paper beside 8, 4/26: yellow paper removed, 5/2: gone, 5/9: gone, 5/24: gone" +2022,jerrod,297,greg,2022-04-05,,,empty,"Before 79, on top of vines. 4/5: collapsed, 4/18: gone, drone--orange paper beside 8, 4/26: yellow paper removed, 5/2: gone, 5/9: gone, 5/24: gone" +2022,jerrod,297,greg,2022-04-11,,,empty,"Before 79, on top of vines. 4/5: collapsed, 4/18: gone, drone--orange paper beside 8, 4/26: yellow paper removed, 5/2: gone, 5/9: gone, 5/24: gone" +2022,jerrod,297,greg,2022-04-18,,,empty,"Before 79, on top of vines. 4/5: collapsed, 4/18: gone, drone--orange paper beside 8, 4/26: yellow paper removed, 5/2: gone, 5/9: gone, 5/24: gone" +2022,jerrod,297,greg,2022-04-26,,,empty,"Before 79, on top of vines. 4/5: collapsed, 4/18: gone, drone--orange paper beside 8, 4/26: yellow paper removed, 5/2: gone, 5/9: gone, 5/24: gone" +2022,jerrod,297,greg,2022-05-02,,,collapsed,"Before 79, on top of vines. 4/5: collapsed, 4/18: gone, drone--orange paper beside 8, 4/26: yellow paper removed, 5/2: gone, 5/9: gone, 5/24: gone" +2022,jerrod,297,greg,2022-05-09,,,collapsed,"Before 79, on top of vines. 4/5: collapsed, 4/18: gone, drone--orange paper beside 8, 4/26: yellow paper removed, 5/2: gone, 5/9: gone, 5/24: gone" +2022,jerrod,297,greg,2022-05-24,,,collapsed,"Before 79, on top of vines. 4/5: collapsed, 4/18: gone, drone--orange paper beside 8, 4/26: yellow paper removed, 5/2: gone, 5/9: gone, 5/24: gone" +2022,jerrod,104,greg,2022-02-21,,,,"Before 79. 4/18: gone, 5/2: gone, 5/9: gone" +2022,jerrod,104,greg,2022-02-28,,,,"Before 79. 4/18: gone, 5/2: gone, 5/9: gone" +2022,jerrod,104,greg,2022-03-14,,,,"Before 79. 4/18: gone, 5/2: gone, 5/9: gone" +2022,jerrod,104,greg,2022-03-21,2,,incubating,"Before 79. 4/18: gone, 5/2: gone, 5/9: gone" +2022,jerrod,104,greg,2022-03-28,,,empty,"Before 79. 4/18: gone, 5/2: gone, 5/9: gone" +2022,jerrod,104,greg,2022-04-05,1,,incubating,"Before 79. 4/18: gone, 5/2: gone, 5/9: gone" +2022,jerrod,104,greg,2022-04-11,,,empty,"Before 79. 4/18: gone, 5/2: gone, 5/9: gone" +2022,jerrod,104,greg,2022-04-18,,,empty,"Before 79. 4/18: gone, 5/2: gone, 5/9: gone" +2022,jerrod,104,greg,2022-04-26,,,missed,"Before 79. 4/18: gone, 5/2: gone, 5/9: gone" +2022,jerrod,104,greg,2022-05-02,,,collapsed,"Before 79. 4/18: gone, 5/2: gone, 5/9: gone" +2022,jerrod,104,greg,2022-05-09,,,collapsed,"Before 79. 4/18: gone, 5/2: gone, 5/9: gone" +2022,jerrod,104,greg,2022-05-24,,,missed,"Before 79. 4/18: gone, 5/2: gone, 5/9: gone" +2022,jerrod,299,greg,2022-02-21,,,,"Before 79, on top of vines. 4/11: dry chicks, 4/18: chicks dry, 4/26: 1c SUPER tiny, 5/2: 1+c, 5/24: blue in nest clear in vines view" +2022,jerrod,299,greg,2022-02-28,,,,"Before 79, on top of vines. 4/11: dry chicks, 4/18: chicks dry, 4/26: 1c SUPER tiny, 5/2: 1+c, 5/24: blue in nest clear in vines view" +2022,jerrod,299,greg,2022-03-14,,,,"Before 79, on top of vines. 4/11: dry chicks, 4/18: chicks dry, 4/26: 1c SUPER tiny, 5/2: 1+c, 5/24: blue in nest clear in vines view" +2022,jerrod,299,greg,2022-03-21,3,,incubating,"Before 79, on top of vines. 4/11: dry chicks, 4/18: chicks dry, 4/26: 1c SUPER tiny, 5/2: 1+c, 5/24: blue in nest clear in vines view" +2022,jerrod,299,greg,2022-03-28,3,,incubating,"Before 79, on top of vines. 4/11: dry chicks, 4/18: chicks dry, 4/26: 1c SUPER tiny, 5/2: 1+c, 5/24: blue in nest clear in vines view" +2022,jerrod,299,greg,2022-04-05,3,,incubating,"Before 79, on top of vines. 4/11: dry chicks, 4/18: chicks dry, 4/26: 1c SUPER tiny, 5/2: 1+c, 5/24: blue in nest clear in vines view" +2022,jerrod,299,greg,2022-04-11,1,2,chick_dry,"Before 79, on top of vines. 4/11: dry chicks, 4/18: chicks dry, 4/26: 1c SUPER tiny, 5/2: 1+c, 5/24: blue in nest clear in vines view" +2022,jerrod,299,greg,2022-04-18,,3,nestling,"Before 79, on top of vines. 4/11: dry chicks, 4/18: chicks dry, 4/26: 1c SUPER tiny, 5/2: 1+c, 5/24: blue in nest clear in vines view" +2022,jerrod,299,greg,2022-04-26,,3,nestling,"Before 79, on top of vines. 4/11: dry chicks, 4/18: chicks dry, 4/26: 1c SUPER tiny, 5/2: 1+c, 5/24: blue in nest clear in vines view" +2022,jerrod,299,greg,2022-05-02,,1,nestling,"Before 79, on top of vines. 4/11: dry chicks, 4/18: chicks dry, 4/26: 1c SUPER tiny, 5/2: 1+c, 5/24: blue in nest clear in vines view" +2022,jerrod,299,greg,2022-05-09,,3,nestling,"Before 79, on top of vines. 4/11: dry chicks, 4/18: chicks dry, 4/26: 1c SUPER tiny, 5/2: 1+c, 5/24: blue in nest clear in vines view" +2022,jerrod,299,greg,2022-05-24,,,empty,"Before 79, on top of vines. 4/11: dry chicks, 4/18: chicks dry, 4/26: 1c SUPER tiny, 5/2: 1+c, 5/24: blue in nest clear in vines view" +2022,jerrod,301,greg,2022-02-21,,,,"Near 104. 4/18: gone, 4/26: gone, 5/9: gone, 5/24: gone" +2022,jerrod,301,greg,2022-02-28,,,,"Near 104. 4/18: gone, 4/26: gone, 5/9: gone, 5/24: gone" +2022,jerrod,301,greg,2022-03-14,,,,"Near 104. 4/18: gone, 4/26: gone, 5/9: gone, 5/24: gone" +2022,jerrod,301,greg,2022-03-21,3,,incubating,"Near 104. 4/18: gone, 4/26: gone, 5/9: gone, 5/24: gone" +2022,jerrod,301,greg,2022-03-28,3,,incubating,"Near 104. 4/18: gone, 4/26: gone, 5/9: gone, 5/24: gone" +2022,jerrod,301,greg,2022-04-05,3,,incubating,"Near 104. 4/18: gone, 4/26: gone, 5/9: gone, 5/24: gone" +2022,jerrod,301,greg,2022-04-11,,,missed,"Near 104. 4/18: gone, 4/26: gone, 5/9: gone, 5/24: gone" +2022,jerrod,301,greg,2022-04-18,,,empty,"Near 104. 4/18: gone, 4/26: gone, 5/9: gone, 5/24: gone" +2022,jerrod,301,greg,2022-04-26,,,empty,"Near 104. 4/18: gone, 4/26: gone, 5/9: gone, 5/24: gone" +2022,jerrod,301,greg,2022-05-02,,,missed,"Near 104. 4/18: gone, 4/26: gone, 5/9: gone, 5/24: gone" +2022,jerrod,301,greg,2022-05-09,,,collapsed,"Near 104. 4/18: gone, 4/26: gone, 5/9: gone, 5/24: gone" +2022,jerrod,301,greg,2022-05-24,,,collapsed,"Near 104. 4/18: gone, 4/26: gone, 5/9: gone, 5/24: gone" +2022,jerrod,543,greg,2022-02-21,,,,"4/11: chicks 3-5 days old, 4/18: drone--yellow paper 4 ft away 7, 4/26: yellow paper removed, +1 dead C in nest, 5/2: nest collapsed but 1C on branch next to tree, 5/9: gone" +2022,jerrod,543,greg,2022-02-28,,,,"4/11: chicks 3-5 days old, 4/18: drone--yellow paper 4 ft away 7, 4/26: yellow paper removed, +1 dead C in nest, 5/2: nest collapsed but 1C on branch next to tree, 5/9: gone" +2022,jerrod,543,greg,2022-03-14,,,,"4/11: chicks 3-5 days old, 4/18: drone--yellow paper 4 ft away 7, 4/26: yellow paper removed, +1 dead C in nest, 5/2: nest collapsed but 1C on branch next to tree, 5/9: gone" +2022,jerrod,543,greg,2022-03-21,,,,"4/11: chicks 3-5 days old, 4/18: drone--yellow paper 4 ft away 7, 4/26: yellow paper removed, +1 dead C in nest, 5/2: nest collapsed but 1C on branch next to tree, 5/9: gone" +2022,jerrod,543,greg,2022-03-28,,,,"4/11: chicks 3-5 days old, 4/18: drone--yellow paper 4 ft away 7, 4/26: yellow paper removed, +1 dead C in nest, 5/2: nest collapsed but 1C on branch next to tree, 5/9: gone" +2022,jerrod,543,greg,2022-04-05,,,,"4/11: chicks 3-5 days old, 4/18: drone--yellow paper 4 ft away 7, 4/26: yellow paper removed, +1 dead C in nest, 5/2: nest collapsed but 1C on branch next to tree, 5/9: gone" +2022,jerrod,543,greg,2022-04-11,,2,nestling,"4/11: chicks 3-5 days old, 4/18: drone--yellow paper 4 ft away 7, 4/26: yellow paper removed, +1 dead C in nest, 5/2: nest collapsed but 1C on branch next to tree, 5/9: gone" +2022,jerrod,543,greg,2022-04-18,,2,nestling,"4/11: chicks 3-5 days old, 4/18: drone--yellow paper 4 ft away 7, 4/26: yellow paper removed, +1 dead C in nest, 5/2: nest collapsed but 1C on branch next to tree, 5/9: gone" +2022,jerrod,543,greg,2022-04-26,,1,nestling,"4/11: chicks 3-5 days old, 4/18: drone--yellow paper 4 ft away 7, 4/26: yellow paper removed, +1 dead C in nest, 5/2: nest collapsed but 1C on branch next to tree, 5/9: gone" +2022,jerrod,543,greg,2022-05-02,,1,branchling,"4/11: chicks 3-5 days old, 4/18: drone--yellow paper 4 ft away 7, 4/26: yellow paper removed, +1 dead C in nest, 5/2: nest collapsed but 1C on branch next to tree, 5/9: gone" +2022,jerrod,543,greg,2022-05-09,,,collapsed,"4/11: chicks 3-5 days old, 4/18: drone--yellow paper 4 ft away 7, 4/26: yellow paper removed, +1 dead C in nest, 5/2: nest collapsed but 1C on branch next to tree, 5/9: gone" +2022,jerrod,543,greg,2022-05-24,,,empty,"4/11: chicks 3-5 days old, 4/18: drone--yellow paper 4 ft away 7, 4/26: yellow paper removed, +1 dead C in nest, 5/2: nest collapsed but 1C on branch next to tree, 5/9: gone" +2022,joule,47,greg,2022-02-21,3,,incubating,"4/18: drone--pink paper next to nest, 4/26: gone, 5/2: flag and nest gone, 5/9: gone, found flag and reattached" +2022,joule,47,greg,2022-02-28,3,,incubating,"4/18: drone--pink paper next to nest, 4/26: gone, 5/2: flag and nest gone, 5/9: gone, found flag and reattached" +2022,joule,47,greg,2022-03-07,,,empty,"4/18: drone--pink paper next to nest, 4/26: gone, 5/2: flag and nest gone, 5/9: gone, found flag and reattached" +2022,joule,47,greg,2022-03-14,,,empty,"4/18: drone--pink paper next to nest, 4/26: gone, 5/2: flag and nest gone, 5/9: gone, found flag and reattached" +2022,joule,47,greg,2022-03-21,,,empty,"4/18: drone--pink paper next to nest, 4/26: gone, 5/2: flag and nest gone, 5/9: gone, found flag and reattached" +2022,joule,47,greg,2022-03-28,,,empty,"4/18: drone--pink paper next to nest, 4/26: gone, 5/2: flag and nest gone, 5/9: gone, found flag and reattached" +2022,joule,47,greg,2022-04-05,,,empty,"4/18: drone--pink paper next to nest, 4/26: gone, 5/2: flag and nest gone, 5/9: gone, found flag and reattached" +2022,joule,47,greg,2022-04-11,,,missed,"4/18: drone--pink paper next to nest, 4/26: gone, 5/2: flag and nest gone, 5/9: gone, found flag and reattached" +2022,joule,47,greg,2022-04-18,,,empty,"4/18: drone--pink paper next to nest, 4/26: gone, 5/2: flag and nest gone, 5/9: gone, found flag and reattached" +2022,joule,47,greg,2022-04-26,,,collapsed,"4/18: drone--pink paper next to nest, 4/26: gone, 5/2: flag and nest gone, 5/9: gone, found flag and reattached" +2022,joule,47,greg,2022-05-02,,,collapsed,"4/18: drone--pink paper next to nest, 4/26: gone, 5/2: flag and nest gone, 5/9: gone, found flag and reattached" +2022,joule,47,greg,2022-05-09,,,collapsed,"4/18: drone--pink paper next to nest, 4/26: gone, 5/2: flag and nest gone, 5/9: gone, found flag and reattached" +2022,joule,20,greg,2022-02-21,2,,incubating,"2/28: eggshells on ground, 3/7: nest collapsed, 3/14: collapsed, pulled" +2022,joule,20,greg,2022-02-28,,,empty,"2/28: eggshells on ground, 3/7: nest collapsed, 3/14: collapsed, pulled" +2022,joule,20,greg,2022-03-07,,,empty,"2/28: eggshells on ground, 3/7: nest collapsed, 3/14: collapsed, pulled" +2022,joule,20,greg,2022-03-14,,,,"2/28: eggshells on ground, 3/7: nest collapsed, 3/14: collapsed, pulled" +2022,joule,20,greg,2022-03-21,,,,"2/28: eggshells on ground, 3/7: nest collapsed, 3/14: collapsed, pulled" +2022,joule,20,greg,2022-03-28,,,,"2/28: eggshells on ground, 3/7: nest collapsed, 3/14: collapsed, pulled" +2022,joule,20,greg,2022-04-05,,,,"2/28: eggshells on ground, 3/7: nest collapsed, 3/14: collapsed, pulled" +2022,joule,20,greg,2022-04-11,,,,"2/28: eggshells on ground, 3/7: nest collapsed, 3/14: collapsed, pulled" +2022,joule,20,greg,2022-04-18,,,,"2/28: eggshells on ground, 3/7: nest collapsed, 3/14: collapsed, pulled" +2022,joule,20,greg,2022-04-26,,,,"2/28: eggshells on ground, 3/7: nest collapsed, 3/14: collapsed, pulled" +2022,joule,20,greg,2022-05-02,,,,"2/28: eggshells on ground, 3/7: nest collapsed, 3/14: collapsed, pulled" +2022,joule,20,greg,2022-05-09,,,,"2/28: eggshells on ground, 3/7: nest collapsed, 3/14: collapsed, pulled" +2022,joule,51,greg,2022-02-21,1,,incubating,"Nest past flag, up to the left. 4/11: drone--yellow paper, 4/18: paper removed, 5/9: gone" +2022,joule,51,greg,2022-02-28,3,,incubating,"Nest past flag, up to the left. 4/11: drone--yellow paper, 4/18: paper removed, 5/9: gone" +2022,joule,51,greg,2022-03-07,,,empty,"Nest past flag, up to the left. 4/11: drone--yellow paper, 4/18: paper removed, 5/9: gone" +2022,joule,51,greg,2022-03-14,,,empty,"Nest past flag, up to the left. 4/11: drone--yellow paper, 4/18: paper removed, 5/9: gone" +2022,joule,51,greg,2022-03-21,,,empty,"Nest past flag, up to the left. 4/11: drone--yellow paper, 4/18: paper removed, 5/9: gone" +2022,joule,51,greg,2022-03-28,,,empty,"Nest past flag, up to the left. 4/11: drone--yellow paper, 4/18: paper removed, 5/9: gone" +2022,joule,51,greg,2022-04-05,,,empty,"Nest past flag, up to the left. 4/11: drone--yellow paper, 4/18: paper removed, 5/9: gone" +2022,joule,51,greg,2022-04-11,,,empty,"Nest past flag, up to the left. 4/11: drone--yellow paper, 4/18: paper removed, 5/9: gone" +2022,joule,51,greg,2022-04-18,,,empty,"Nest past flag, up to the left. 4/11: drone--yellow paper, 4/18: paper removed, 5/9: gone" +2022,joule,51,greg,2022-04-26,,,empty,"Nest past flag, up to the left. 4/11: drone--yellow paper, 4/18: paper removed, 5/9: gone" +2022,joule,51,greg,2022-05-02,,,empty,"Nest past flag, up to the left. 4/11: drone--yellow paper, 4/18: paper removed, 5/9: gone" +2022,joule,51,greg,2022-05-09,,,collapsed,"Nest past flag, up to the left. 4/11: drone--yellow paper, 4/18: paper removed, 5/9: gone" +2022,joule,22,greg,2022-02-21,2,,incubating,"4/18: can't find/across trail from 51" +2022,joule,22,greg,2022-02-28,2,,incubating,"4/18: can't find/across trail from 51" +2022,joule,22,greg,2022-03-07,2,,incubating,"4/18: can't find/across trail from 51" +2022,joule,22,greg,2022-03-14,,,missed,"4/18: can't find/across trail from 51" +2022,joule,22,greg,2022-03-21,,,empty,"4/18: can't find/across trail from 51" +2022,joule,22,greg,2022-03-28,,,empty,"4/18: can't find/across trail from 51" +2022,joule,22,greg,2022-04-05,,,empty,"4/18: can't find/across trail from 51" +2022,joule,22,greg,2022-04-11,,,empty,"4/18: can't find/across trail from 51" +2022,joule,22,greg,2022-04-18,,,missed,"4/18: can't find/across trail from 51" +2022,joule,22,greg,2022-04-26,,,empty,"4/18: can't find/across trail from 51" +2022,joule,22,greg,2022-05-02,,,empty,"4/18: can't find/across trail from 51" +2022,joule,22,greg,2022-05-09,,,empty,"4/18: can't find/across trail from 51" +2022,joule,53,greg,2022-02-21,1,,incubating,"4/11: drone--blue flagging, 4/18: paper removed" +2022,joule,53,greg,2022-02-28,,,empty,"4/11: drone--blue flagging, 4/18: paper removed" +2022,joule,53,greg,2022-03-07,,,empty,"4/11: drone--blue flagging, 4/18: paper removed" +2022,joule,53,greg,2022-03-14,,,empty,"4/11: drone--blue flagging, 4/18: paper removed" +2022,joule,53,greg,2022-03-21,,,empty,"4/11: drone--blue flagging, 4/18: paper removed" +2022,joule,53,greg,2022-03-28,,,empty,"4/11: drone--blue flagging, 4/18: paper removed" +2022,joule,53,greg,2022-04-05,,,empty,"4/11: drone--blue flagging, 4/18: paper removed" +2022,joule,53,greg,2022-04-11,,,empty,"4/11: drone--blue flagging, 4/18: paper removed" +2022,joule,53,greg,2022-04-18,,,empty,"4/11: drone--blue flagging, 4/18: paper removed" +2022,joule,53,greg,2022-04-26,,,empty,"4/11: drone--blue flagging, 4/18: paper removed" +2022,joule,53,greg,2022-05-02,,,empty,"4/11: drone--blue flagging, 4/18: paper removed" +2022,joule,53,greg,2022-05-09,,,empty,"4/11: drone--blue flagging, 4/18: paper removed" +2022,joule,55,greg,2022-02-21,3,,incubating,"3/7: egg on ground, 3/28: pulled, partial collapse, 4/5: collapsed, 4/18: gone, drone--blue paper 3, 4/26: paper removed, 5/2: gone, 5/9: gone" +2022,joule,55,greg,2022-02-28,3,,incubating,"3/7: egg on ground, 3/28: pulled, partial collapse, 4/5: collapsed, 4/18: gone, drone--blue paper 3, 4/26: paper removed, 5/2: gone, 5/9: gone" +2022,joule,55,greg,2022-03-07,,,empty,"3/7: egg on ground, 3/28: pulled, partial collapse, 4/5: collapsed, 4/18: gone, drone--blue paper 3, 4/26: paper removed, 5/2: gone, 5/9: gone" +2022,joule,55,greg,2022-03-14,,,empty,"3/7: egg on ground, 3/28: pulled, partial collapse, 4/5: collapsed, 4/18: gone, drone--blue paper 3, 4/26: paper removed, 5/2: gone, 5/9: gone" +2022,joule,55,greg,2022-03-21,,,empty,"3/7: egg on ground, 3/28: pulled, partial collapse, 4/5: collapsed, 4/18: gone, drone--blue paper 3, 4/26: paper removed, 5/2: gone, 5/9: gone" +2022,joule,55,greg,2022-03-28,,,empty,"3/7: egg on ground, 3/28: pulled, partial collapse, 4/5: collapsed, 4/18: gone, drone--blue paper 3, 4/26: paper removed, 5/2: gone, 5/9: gone" +2022,joule,55,greg,2022-04-05,,,empty,"3/7: egg on ground, 3/28: pulled, partial collapse, 4/5: collapsed, 4/18: gone, drone--blue paper 3, 4/26: paper removed, 5/2: gone, 5/9: gone" +2022,joule,55,greg,2022-04-11,,,empty,"3/7: egg on ground, 3/28: pulled, partial collapse, 4/5: collapsed, 4/18: gone, drone--blue paper 3, 4/26: paper removed, 5/2: gone, 5/9: gone" +2022,joule,55,greg,2022-04-18,,,empty,"3/7: egg on ground, 3/28: pulled, partial collapse, 4/5: collapsed, 4/18: gone, drone--blue paper 3, 4/26: paper removed, 5/2: gone, 5/9: gone" +2022,joule,55,greg,2022-04-26,,,empty,"3/7: egg on ground, 3/28: pulled, partial collapse, 4/5: collapsed, 4/18: gone, drone--blue paper 3, 4/26: paper removed, 5/2: gone, 5/9: gone" +2022,joule,55,greg,2022-05-02,,,collapsed,"3/7: egg on ground, 3/28: pulled, partial collapse, 4/5: collapsed, 4/18: gone, drone--blue paper 3, 4/26: paper removed, 5/2: gone, 5/9: gone" +2022,joule,55,greg,2022-05-09,,,collapsed,"3/7: egg on ground, 3/28: pulled, partial collapse, 4/5: collapsed, 4/18: gone, drone--blue paper 3, 4/26: paper removed, 5/2: gone, 5/9: gone" +2022,joule,900,greg,2022-02-21,,,,"After 47. 3/21: snake on branch, 4/11: drone--red paper, 4/18: paper removed, 5/2: veg overgrown around nest" +2022,joule,900,greg,2022-02-28,3,,incubating,"After 47. 3/21: snake on branch, 4/11: drone--red paper, 4/18: paper removed, 5/2: veg overgrown around nest" +2022,joule,900,greg,2022-03-07,3,,incubating,"After 47. 3/21: snake on branch, 4/11: drone--red paper, 4/18: paper removed, 5/2: veg overgrown around nest" +2022,joule,900,greg,2022-03-14,3,,incubating,"After 47. 3/21: snake on branch, 4/11: drone--red paper, 4/18: paper removed, 5/2: veg overgrown around nest" +2022,joule,900,greg,2022-03-21,,,empty,"After 47. 3/21: snake on branch, 4/11: drone--red paper, 4/18: paper removed, 5/2: veg overgrown around nest" +2022,joule,900,greg,2022-03-28,,,empty,"After 47. 3/21: snake on branch, 4/11: drone--red paper, 4/18: paper removed, 5/2: veg overgrown around nest" +2022,joule,900,greg,2022-04-05,,,empty,"After 47. 3/21: snake on branch, 4/11: drone--red paper, 4/18: paper removed, 5/2: veg overgrown around nest" +2022,joule,900,greg,2022-04-11,,,empty,"After 47. 3/21: snake on branch, 4/11: drone--red paper, 4/18: paper removed, 5/2: veg overgrown around nest" +2022,joule,900,greg,2022-04-18,,,empty,"After 47. 3/21: snake on branch, 4/11: drone--red paper, 4/18: paper removed, 5/2: veg overgrown around nest" +2022,joule,900,greg,2022-04-26,,,empty,"After 47. 3/21: snake on branch, 4/11: drone--red paper, 4/18: paper removed, 5/2: veg overgrown around nest" +2022,joule,900,greg,2022-05-02,,,empty,"After 47. 3/21: snake on branch, 4/11: drone--red paper, 4/18: paper removed, 5/2: veg overgrown around nest" +2022,joule,900,greg,2022-05-09,,,empty,"After 47. 3/21: snake on branch, 4/11: drone--red paper, 4/18: paper removed, 5/2: veg overgrown around nest" +2022,joule,902,greg,2022-02-21,,,,"4/18: drone--yellow paper 2, 4/26: paper blew away" +2022,joule,902,greg,2022-02-28,2,,incubating,"4/18: drone--yellow paper 2, 4/26: paper blew away" +2022,joule,902,greg,2022-03-07,2,,incubating,"4/18: drone--yellow paper 2, 4/26: paper blew away" +2022,joule,902,greg,2022-03-14,2,,incubating,"4/18: drone--yellow paper 2, 4/26: paper blew away" +2022,joule,902,greg,2022-03-21,,,empty,"4/18: drone--yellow paper 2, 4/26: paper blew away" +2022,joule,902,greg,2022-03-28,,,empty,"4/18: drone--yellow paper 2, 4/26: paper blew away" +2022,joule,902,greg,2022-04-05,,,empty,"4/18: drone--yellow paper 2, 4/26: paper blew away" +2022,joule,902,greg,2022-04-11,,,missed,"4/18: drone--yellow paper 2, 4/26: paper blew away" +2022,joule,902,greg,2022-04-18,,,empty,"4/18: drone--yellow paper 2, 4/26: paper blew away" +2022,joule,902,greg,2022-04-26,,,empty,"4/18: drone--yellow paper 2, 4/26: paper blew away" +2022,joule,902,greg,2022-05-02,,,empty,"4/18: drone--yellow paper 2, 4/26: paper blew away" +2022,joule,902,greg,2022-05-09,,,empty,"4/18: drone--yellow paper 2, 4/26: paper blew away" +2022,joule,57,greg,2022-02-21,2,,incubating,"4/18: mercury sample taken, 2c branchlings, 4/26: 2c branchlings on branch, 5/2: 2c branchlings in next tree" +2022,joule,57,greg,2022-02-28,3,,incubating,"4/18: mercury sample taken, 2c branchlings, 4/26: 2c branchlings on branch, 5/2: 2c branchlings in next tree" +2022,joule,57,greg,2022-03-07,3,,incubating,"4/18: mercury sample taken, 2c branchlings, 4/26: 2c branchlings on branch, 5/2: 2c branchlings in next tree" +2022,joule,57,greg,2022-03-14,3,,incubating,"4/18: mercury sample taken, 2c branchlings, 4/26: 2c branchlings on branch, 5/2: 2c branchlings in next tree" +2022,joule,57,greg,2022-03-21,,3,nestling,"4/18: mercury sample taken, 2c branchlings, 4/26: 2c branchlings on branch, 5/2: 2c branchlings in next tree" +2022,joule,57,greg,2022-03-28,,3,nestling,"4/18: mercury sample taken, 2c branchlings, 4/26: 2c branchlings on branch, 5/2: 2c branchlings in next tree" +2022,joule,57,greg,2022-04-05,,3,nestling,"4/18: mercury sample taken, 2c branchlings, 4/26: 2c branchlings on branch, 5/2: 2c branchlings in next tree" +2022,joule,57,greg,2022-04-11,,2,nestling,"4/18: mercury sample taken, 2c branchlings, 4/26: 2c branchlings on branch, 5/2: 2c branchlings in next tree" +2022,joule,57,greg,2022-04-18,,2,branchling,"4/18: mercury sample taken, 2c branchlings, 4/26: 2c branchlings on branch, 5/2: 2c branchlings in next tree" +2022,joule,57,greg,2022-04-26,,2,branchling,"4/18: mercury sample taken, 2c branchlings, 4/26: 2c branchlings on branch, 5/2: 2c branchlings in next tree" +2022,joule,57,greg,2022-05-02,,2,branchling,"4/18: mercury sample taken, 2c branchlings, 4/26: 2c branchlings on branch, 5/2: 2c branchlings in next tree" +2022,joule,57,greg,2022-05-09,,,empty,"4/18: mercury sample taken, 2c branchlings, 4/26: 2c branchlings on branch, 5/2: 2c branchlings in next tree" +2022,joule,412,greg,2022-02-21,,,,"3/21: chick wet, 4/26: branchling, 5/2: in next tree over 1C branchling, 5/9: gone" +2022,joule,412,greg,2022-02-28,3,,incubating,"3/21: chick wet, 4/26: branchling, 5/2: in next tree over 1C branchling, 5/9: gone" +2022,joule,412,greg,2022-03-07,3,,incubating,"3/21: chick wet, 4/26: branchling, 5/2: in next tree over 1C branchling, 5/9: gone" +2022,joule,412,greg,2022-03-14,3,,incubating,"3/21: chick wet, 4/26: branchling, 5/2: in next tree over 1C branchling, 5/9: gone" +2022,joule,412,greg,2022-03-21,2,1,wet_chick,"3/21: chick wet, 4/26: branchling, 5/2: in next tree over 1C branchling, 5/9: gone" +2022,joule,412,greg,2022-03-28,,3,nestling,"3/21: chick wet, 4/26: branchling, 5/2: in next tree over 1C branchling, 5/9: gone" +2022,joule,412,greg,2022-04-05,,3,nestling,"3/21: chick wet, 4/26: branchling, 5/2: in next tree over 1C branchling, 5/9: gone" +2022,joule,412,greg,2022-04-11,,3,nestling,"3/21: chick wet, 4/26: branchling, 5/2: in next tree over 1C branchling, 5/9: gone" +2022,joule,412,greg,2022-04-18,,2,nestling,"3/21: chick wet, 4/26: branchling, 5/2: in next tree over 1C branchling, 5/9: gone" +2022,joule,412,greg,2022-04-26,,1,branchling,"3/21: chick wet, 4/26: branchling, 5/2: in next tree over 1C branchling, 5/9: gone" +2022,joule,412,greg,2022-05-02,,1,branchling,"3/21: chick wet, 4/26: branchling, 5/2: in next tree over 1C branchling, 5/9: gone" +2022,joule,412,greg,2022-05-09,,,collapsed,"3/21: chick wet, 4/26: branchling, 5/2: in next tree over 1C branchling, 5/9: gone" +2022,joule,414,greg,2022-02-21,,,,"3/21: egg on ground, 4/5: partial collapse, 4/18: gone, drone--orange paper 4, 4/26: nest gone, paper gone, 5/2: gone, 5/9: gone" +2022,joule,414,greg,2022-02-28,2,,incubating,"3/21: egg on ground, 4/5: partial collapse, 4/18: gone, drone--orange paper 4, 4/26: nest gone, paper gone, 5/2: gone, 5/9: gone" +2022,joule,414,greg,2022-03-07,,,empty,"3/21: egg on ground, 4/5: partial collapse, 4/18: gone, drone--orange paper 4, 4/26: nest gone, paper gone, 5/2: gone, 5/9: gone" +2022,joule,414,greg,2022-03-14,,,empty,"3/21: egg on ground, 4/5: partial collapse, 4/18: gone, drone--orange paper 4, 4/26: nest gone, paper gone, 5/2: gone, 5/9: gone" +2022,joule,414,greg,2022-03-21,,,empty,"3/21: egg on ground, 4/5: partial collapse, 4/18: gone, drone--orange paper 4, 4/26: nest gone, paper gone, 5/2: gone, 5/9: gone" +2022,joule,414,greg,2022-03-28,,,empty,"3/21: egg on ground, 4/5: partial collapse, 4/18: gone, drone--orange paper 4, 4/26: nest gone, paper gone, 5/2: gone, 5/9: gone" +2022,joule,414,greg,2022-04-05,,,empty,"3/21: egg on ground, 4/5: partial collapse, 4/18: gone, drone--orange paper 4, 4/26: nest gone, paper gone, 5/2: gone, 5/9: gone" +2022,joule,414,greg,2022-04-11,,,empty,"3/21: egg on ground, 4/5: partial collapse, 4/18: gone, drone--orange paper 4, 4/26: nest gone, paper gone, 5/2: gone, 5/9: gone" +2022,joule,414,greg,2022-04-18,,,collapsed,"3/21: egg on ground, 4/5: partial collapse, 4/18: gone, drone--orange paper 4, 4/26: nest gone, paper gone, 5/2: gone, 5/9: gone" +2022,joule,414,greg,2022-04-26,,,collapsed,"3/21: egg on ground, 4/5: partial collapse, 4/18: gone, drone--orange paper 4, 4/26: nest gone, paper gone, 5/2: gone, 5/9: gone" +2022,joule,414,greg,2022-05-02,,,collapsed,"3/21: egg on ground, 4/5: partial collapse, 4/18: gone, drone--orange paper 4, 4/26: nest gone, paper gone, 5/2: gone, 5/9: gone" +2022,joule,414,greg,2022-05-09,,,collapsed,"3/21: egg on ground, 4/5: partial collapse, 4/18: gone, drone--orange paper 4, 4/26: nest gone, paper gone, 5/2: gone, 5/9: gone" +2022,joule,904,greg,2022-02-21,,,,"3/21: 1 chick dead on back of nest" +2022,joule,904,greg,2022-02-28,3,,incubating,"3/21: 1 chick dead on back of nest" +2022,joule,904,greg,2022-03-07,3,,incubating,"3/21: 1 chick dead on back of nest" +2022,joule,904,greg,2022-03-14,1,1,hatching,"3/21: 1 chick dead on back of nest" +2022,joule,904,greg,2022-03-21,,,empty,"3/21: 1 chick dead on back of nest" +2022,joule,904,greg,2022-03-28,,,empty,"3/21: 1 chick dead on back of nest" +2022,joule,904,greg,2022-04-05,,,empty,"3/21: 1 chick dead on back of nest" +2022,joule,904,greg,2022-04-11,,,missed,"3/21: 1 chick dead on back of nest" +2022,joule,904,greg,2022-04-18,,,empty,"3/21: 1 chick dead on back of nest" +2022,joule,904,greg,2022-04-26,,,empty,"3/21: 1 chick dead on back of nest" +2022,joule,904,greg,2022-05-02,,,empty,"3/21: 1 chick dead on back of nest" +2022,joule,904,greg,2022-05-09,,,empty,"3/21: 1 chick dead on back of nest" +2022,joule,59,greg,2022-02-21,1,,incubating,"3/7: nest collapsed, 3/14: pulled" +2022,joule,59,greg,2022-02-28,,,empty,"3/7: nest collapsed, 3/14: pulled" +2022,joule,59,greg,2022-03-07,,,empty,"3/7: nest collapsed, 3/14: pulled" +2022,joule,59,greg,2022-03-14,,,,"3/7: nest collapsed, 3/14: pulled" +2022,joule,59,greg,2022-03-21,,,,"3/7: nest collapsed, 3/14: pulled" +2022,joule,59,greg,2022-03-28,,,,"3/7: nest collapsed, 3/14: pulled" +2022,joule,59,greg,2022-04-05,,,,"3/7: nest collapsed, 3/14: pulled" +2022,joule,59,greg,2022-04-11,,,,"3/7: nest collapsed, 3/14: pulled" +2022,joule,59,greg,2022-04-18,,,,"3/7: nest collapsed, 3/14: pulled" +2022,joule,59,greg,2022-04-26,,,,"3/7: nest collapsed, 3/14: pulled" +2022,joule,59,greg,2022-05-02,,,,"3/7: nest collapsed, 3/14: pulled" +2022,joule,59,greg,2022-05-09,,,,"3/7: nest collapsed, 3/14: pulled" +2022,joule,416,greg,2022-02-21,,,,"3/14: chick wet, 4/26: 2c branchlings" +2022,joule,416,greg,2022-02-28,2,,incubating,"3/14: chick wet, 4/26: 2c branchlings" +2022,joule,416,greg,2022-03-07,2,,incubating,"3/14: chick wet, 4/26: 2c branchlings" +2022,joule,416,greg,2022-03-14,,2,wet_chick,"3/14: chick wet, 4/26: 2c branchlings" +2022,joule,416,greg,2022-03-21,,2,nestling,"3/14: chick wet, 4/26: 2c branchlings" +2022,joule,416,greg,2022-03-28,,2,nestling,"3/14: chick wet, 4/26: 2c branchlings" +2022,joule,416,greg,2022-04-05,,2,nestling,"3/14: chick wet, 4/26: 2c branchlings" +2022,joule,416,greg,2022-04-11,,2,nestling,"3/14: chick wet, 4/26: 2c branchlings" +2022,joule,416,greg,2022-04-18,,1,nestling,"3/14: chick wet, 4/26: 2c branchlings" +2022,joule,416,greg,2022-04-26,,2,branchling,"3/14: chick wet, 4/26: 2c branchlings" +2022,joule,416,greg,2022-05-02,,,empty,"3/14: chick wet, 4/26: 2c branchlings" +2022,joule,416,greg,2022-05-09,,,empty,"3/14: chick wet, 4/26: 2c branchlings" +2022,joule,906,greg,2022-02-21,,,,"Nest is behind the flag. 3/28: pulled, partial collapse, 5/9: gone" +2022,joule,906,greg,2022-02-28,2,,incubating,"Nest is behind the flag. 3/28: pulled, partial collapse, 5/9: gone" +2022,joule,906,greg,2022-03-07,3,,incubating,"Nest is behind the flag. 3/28: pulled, partial collapse, 5/9: gone" +2022,joule,906,greg,2022-03-14,3,,incubating,"Nest is behind the flag. 3/28: pulled, partial collapse, 5/9: gone" +2022,joule,906,greg,2022-03-21,,,empty,"Nest is behind the flag. 3/28: pulled, partial collapse, 5/9: gone" +2022,joule,906,greg,2022-03-28,,,empty,"Nest is behind the flag. 3/28: pulled, partial collapse, 5/9: gone" +2022,joule,906,greg,2022-04-05,,,missed,"Nest is behind the flag. 3/28: pulled, partial collapse, 5/9: gone" +2022,joule,906,greg,2022-04-11,,,missed,"Nest is behind the flag. 3/28: pulled, partial collapse, 5/9: gone" +2022,joule,906,greg,2022-04-18,,,missed,"Nest is behind the flag. 3/28: pulled, partial collapse, 5/9: gone" +2022,joule,906,greg,2022-04-26,,,missed,"Nest is behind the flag. 3/28: pulled, partial collapse, 5/9: gone" +2022,joule,906,greg,2022-05-02,,,empty,"Nest is behind the flag. 3/28: pulled, partial collapse, 5/9: gone" +2022,joule,906,greg,2022-05-09,,,collapsed,"Nest is behind the flag. 3/28: pulled, partial collapse, 5/9: gone" +2022,joule,61,greg,2022-02-21,2,,incubating,"3/21: chicks dry, 3/28: one dead chick, smaller, 4/18: drone--pink paper beside 8, 3 ft left, 4/26: paper removed" +2022,joule,61,greg,2022-02-28,3,,incubating,"3/21: chicks dry, 3/28: one dead chick, smaller, 4/18: drone--pink paper beside 8, 3 ft left, 4/26: paper removed" +2022,joule,61,greg,2022-03-07,3,,incubating,"3/21: chicks dry, 3/28: one dead chick, smaller, 4/18: drone--pink paper beside 8, 3 ft left, 4/26: paper removed" +2022,joule,61,greg,2022-03-14,3,,incubating,"3/21: chicks dry, 3/28: one dead chick, smaller, 4/18: drone--pink paper beside 8, 3 ft left, 4/26: paper removed" +2022,joule,61,greg,2022-03-21,1,2,hatching,"3/21: chicks dry, 3/28: one dead chick, smaller, 4/18: drone--pink paper beside 8, 3 ft left, 4/26: paper removed" +2022,joule,61,greg,2022-03-28,,2,nestling,"3/21: chicks dry, 3/28: one dead chick, smaller, 4/18: drone--pink paper beside 8, 3 ft left, 4/26: paper removed" +2022,joule,61,greg,2022-04-05,,2,nestling,"3/21: chicks dry, 3/28: one dead chick, smaller, 4/18: drone--pink paper beside 8, 3 ft left, 4/26: paper removed" +2022,joule,61,greg,2022-04-11,,2,nestling,"3/21: chicks dry, 3/28: one dead chick, smaller, 4/18: drone--pink paper beside 8, 3 ft left, 4/26: paper removed" +2022,joule,61,greg,2022-04-18,,1,nestling,"3/21: chicks dry, 3/28: one dead chick, smaller, 4/18: drone--pink paper beside 8, 3 ft left, 4/26: paper removed" +2022,joule,61,greg,2022-04-26,,1,nestling,"3/21: chicks dry, 3/28: one dead chick, smaller, 4/18: drone--pink paper beside 8, 3 ft left, 4/26: paper removed" +2022,joule,61,greg,2022-05-02,,,empty,"3/21: chicks dry, 3/28: one dead chick, smaller, 4/18: drone--pink paper beside 8, 3 ft left, 4/26: paper removed" +2022,joule,61,greg,2022-05-09,,,empty,"3/21: chicks dry, 3/28: one dead chick, smaller, 4/18: drone--pink paper beside 8, 3 ft left, 4/26: paper removed" +2022,joule,63,greg,2022-02-21,3,,incubating,"3/21: chicks big, 4/11: sampled for mercury, 4/18: drone--blue paper 9, 1 ft from nest, 1 chick out of nest, top of tree, 4/26: paper removed, 5/9: gone" +2022,joule,63,greg,2022-02-28,3,,incubating,"3/21: chicks big, 4/11: sampled for mercury, 4/18: drone--blue paper 9, 1 ft from nest, 1 chick out of nest, top of tree, 4/26: paper removed, 5/9: gone" +2022,joule,63,greg,2022-03-07,3,,incubating,"3/21: chicks big, 4/11: sampled for mercury, 4/18: drone--blue paper 9, 1 ft from nest, 1 chick out of nest, top of tree, 4/26: paper removed, 5/9: gone" +2022,joule,63,greg,2022-03-14,,2,nestling,"3/21: chicks big, 4/11: sampled for mercury, 4/18: drone--blue paper 9, 1 ft from nest, 1 chick out of nest, top of tree, 4/26: paper removed, 5/9: gone" +2022,joule,63,greg,2022-03-21,,2,nestling,"3/21: chicks big, 4/11: sampled for mercury, 4/18: drone--blue paper 9, 1 ft from nest, 1 chick out of nest, top of tree, 4/26: paper removed, 5/9: gone" +2022,joule,63,greg,2022-03-28,,2,nestling,"3/21: chicks big, 4/11: sampled for mercury, 4/18: drone--blue paper 9, 1 ft from nest, 1 chick out of nest, top of tree, 4/26: paper removed, 5/9: gone" +2022,joule,63,greg,2022-04-05,,2,nestling,"3/21: chicks big, 4/11: sampled for mercury, 4/18: drone--blue paper 9, 1 ft from nest, 1 chick out of nest, top of tree, 4/26: paper removed, 5/9: gone" +2022,joule,63,greg,2022-04-11,,2,nestling,"3/21: chicks big, 4/11: sampled for mercury, 4/18: drone--blue paper 9, 1 ft from nest, 1 chick out of nest, top of tree, 4/26: paper removed, 5/9: gone" +2022,joule,63,greg,2022-04-18,,1,branchling,"3/21: chicks big, 4/11: sampled for mercury, 4/18: drone--blue paper 9, 1 ft from nest, 1 chick out of nest, top of tree, 4/26: paper removed, 5/9: gone" +2022,joule,63,greg,2022-04-26,,,empty,"3/21: chicks big, 4/11: sampled for mercury, 4/18: drone--blue paper 9, 1 ft from nest, 1 chick out of nest, top of tree, 4/26: paper removed, 5/9: gone" +2022,joule,63,greg,2022-05-02,,,empty,"3/21: chicks big, 4/11: sampled for mercury, 4/18: drone--blue paper 9, 1 ft from nest, 1 chick out of nest, top of tree, 4/26: paper removed, 5/9: gone" +2022,joule,63,greg,2022-05-09,,,collapsed,"3/21: chicks big, 4/11: sampled for mercury, 4/18: drone--blue paper 9, 1 ft from nest, 1 chick out of nest, top of tree, 4/26: paper removed, 5/9: gone" +2022,joule,24,greg,2022-02-21,3,,incubating,"4/5: big chicks, 4/18: 2c branchlings, 4/26: 2c branchlings on branch" +2022,joule,24,greg,2022-02-28,3,,incubating,"4/5: big chicks, 4/18: 2c branchlings, 4/26: 2c branchlings on branch" +2022,joule,24,greg,2022-03-07,3,,incubating,"4/5: big chicks, 4/18: 2c branchlings, 4/26: 2c branchlings on branch" +2022,joule,24,greg,2022-03-14,3,,incubating,"4/5: big chicks, 4/18: 2c branchlings, 4/26: 2c branchlings on branch" +2022,joule,24,greg,2022-03-21,,2,nestling,"4/5: big chicks, 4/18: 2c branchlings, 4/26: 2c branchlings on branch" +2022,joule,24,greg,2022-03-28,,3,nestling,"4/5: big chicks, 4/18: 2c branchlings, 4/26: 2c branchlings on branch" +2022,joule,24,greg,2022-04-05,,2,nestling,"4/5: big chicks, 4/18: 2c branchlings, 4/26: 2c branchlings on branch" +2022,joule,24,greg,2022-04-11,,2,nestling,"4/5: big chicks, 4/18: 2c branchlings, 4/26: 2c branchlings on branch" +2022,joule,24,greg,2022-04-18,,2,branchling,"4/5: big chicks, 4/18: 2c branchlings, 4/26: 2c branchlings on branch" +2022,joule,24,greg,2022-04-26,,2,branchling,"4/5: big chicks, 4/18: 2c branchlings, 4/26: 2c branchlings on branch" +2022,joule,24,greg,2022-05-02,,,empty,"4/5: big chicks, 4/18: 2c branchlings, 4/26: 2c branchlings on branch" +2022,joule,24,greg,2022-05-09,,,empty,"4/5: big chicks, 4/18: 2c branchlings, 4/26: 2c branchlings on branch" +2022,joule,418,greg,2022-02-21,,,,"3/7: one egg on ground, one buried by stick, 4/11: drone-yellow paper, 4/18: yellow paper removed" +2022,joule,418,greg,2022-02-28,2,,incubating,"3/7: one egg on ground, one buried by stick, 4/11: drone-yellow paper, 4/18: yellow paper removed" +2022,joule,418,greg,2022-03-07,1,,incubating,"3/7: one egg on ground, one buried by stick, 4/11: drone-yellow paper, 4/18: yellow paper removed" +2022,joule,418,greg,2022-03-14,,,empty,"3/7: one egg on ground, one buried by stick, 4/11: drone-yellow paper, 4/18: yellow paper removed" +2022,joule,418,greg,2022-03-21,,,empty,"3/7: one egg on ground, one buried by stick, 4/11: drone-yellow paper, 4/18: yellow paper removed" +2022,joule,418,greg,2022-03-28,,,empty,"3/7: one egg on ground, one buried by stick, 4/11: drone-yellow paper, 4/18: yellow paper removed" +2022,joule,418,greg,2022-04-05,,,empty,"3/7: one egg on ground, one buried by stick, 4/11: drone-yellow paper, 4/18: yellow paper removed" +2022,joule,418,greg,2022-04-11,,,empty,"3/7: one egg on ground, one buried by stick, 4/11: drone-yellow paper, 4/18: yellow paper removed" +2022,joule,418,greg,2022-04-18,,,empty,"3/7: one egg on ground, one buried by stick, 4/11: drone-yellow paper, 4/18: yellow paper removed" +2022,joule,418,greg,2022-04-26,,,empty,"3/7: one egg on ground, one buried by stick, 4/11: drone-yellow paper, 4/18: yellow paper removed" +2022,joule,418,greg,2022-05-02,,,empty,"3/7: one egg on ground, one buried by stick, 4/11: drone-yellow paper, 4/18: yellow paper removed" +2022,joule,418,greg,2022-05-09,,,empty,"3/7: one egg on ground, one buried by stick, 4/11: drone-yellow paper, 4/18: yellow paper removed" +2022,joule,65,greg,2022-02-21,2,,incubating,"4/18: drone--green paper 10" +2022,joule,65,greg,2022-02-28,3,,incubating,"4/18: drone--green paper 10" +2022,joule,65,greg,2022-03-07,3,,incubating,"4/18: drone--green paper 10" +2022,joule,65,greg,2022-03-14,3,,incubating,"4/18: drone--green paper 10" +2022,joule,65,greg,2022-03-21,,2,nestling,"4/18: drone--green paper 10" +2022,joule,65,greg,2022-03-28,,,empty,"4/18: drone--green paper 10" +2022,joule,65,greg,2022-04-05,,,empty,"4/18: drone--green paper 10" +2022,joule,65,greg,2022-04-11,,,empty,"4/18: drone--green paper 10" +2022,joule,65,greg,2022-04-18,,,empty,"4/18: drone--green paper 10" +2022,joule,65,greg,2022-04-26,,,missed,"4/18: drone--green paper 10" +2022,joule,65,greg,2022-05-02,,,empty,"4/18: drone--green paper 10" +2022,joule,65,greg,2022-05-09,,,empty,"4/18: drone--green paper 10" +2022,joule,420,greg,2022-02-21,,,,"4/5: mercury sample taken, 4/11: mercury sample taken, 4/18: branchling, 4/26: 1c branchling high in tree" +2022,joule,420,greg,2022-02-28,3,,incubating,"4/5: mercury sample taken, 4/11: mercury sample taken, 4/18: branchling, 4/26: 1c branchling high in tree" +2022,joule,420,greg,2022-03-07,3,,incubating,"4/5: mercury sample taken, 4/11: mercury sample taken, 4/18: branchling, 4/26: 1c branchling high in tree" +2022,joule,420,greg,2022-03-14,1,2,hatching,"4/5: mercury sample taken, 4/11: mercury sample taken, 4/18: branchling, 4/26: 1c branchling high in tree" +2022,joule,420,greg,2022-03-21,,3,nestling,"4/5: mercury sample taken, 4/11: mercury sample taken, 4/18: branchling, 4/26: 1c branchling high in tree" +2022,joule,420,greg,2022-03-28,,1,nestling,"4/5: mercury sample taken, 4/11: mercury sample taken, 4/18: branchling, 4/26: 1c branchling high in tree" +2022,joule,420,greg,2022-04-05,,1,nestling,"4/5: mercury sample taken, 4/11: mercury sample taken, 4/18: branchling, 4/26: 1c branchling high in tree" +2022,joule,420,greg,2022-04-11,,1,nestling,"4/5: mercury sample taken, 4/11: mercury sample taken, 4/18: branchling, 4/26: 1c branchling high in tree" +2022,joule,420,greg,2022-04-18,,1,branchling,"4/5: mercury sample taken, 4/11: mercury sample taken, 4/18: branchling, 4/26: 1c branchling high in tree" +2022,joule,420,greg,2022-04-26,,1,branchling,"4/5: mercury sample taken, 4/11: mercury sample taken, 4/18: branchling, 4/26: 1c branchling high in tree" +2022,joule,420,greg,2022-05-02,,,empty,"4/5: mercury sample taken, 4/11: mercury sample taken, 4/18: branchling, 4/26: 1c branchling high in tree" +2022,joule,420,greg,2022-05-09,,,empty,"4/5: mercury sample taken, 4/11: mercury sample taken, 4/18: branchling, 4/26: 1c branchling high in tree" +2022,joule,422,greg,2022-02-21,,,,"4/18: drone--blue paper 6, collapsed, 4/26: paper gone, 5/2: gone" +2022,joule,422,greg,2022-02-28,3,,incubating,"4/18: drone--blue paper 6, collapsed, 4/26: paper gone, 5/2: gone" +2022,joule,422,greg,2022-03-07,3,,incubating,"4/18: drone--blue paper 6, collapsed, 4/26: paper gone, 5/2: gone" +2022,joule,422,greg,2022-03-14,3,,incubating,"4/18: drone--blue paper 6, collapsed, 4/26: paper gone, 5/2: gone" +2022,joule,422,greg,2022-03-21,3,,incubating,"4/18: drone--blue paper 6, collapsed, 4/26: paper gone, 5/2: gone" +2022,joule,422,greg,2022-03-28,,,empty,"4/18: drone--blue paper 6, collapsed, 4/26: paper gone, 5/2: gone" +2022,joule,422,greg,2022-04-05,,,empty,"4/18: drone--blue paper 6, collapsed, 4/26: paper gone, 5/2: gone" +2022,joule,422,greg,2022-04-11,,,missed,"4/18: drone--blue paper 6, collapsed, 4/26: paper gone, 5/2: gone" +2022,joule,422,greg,2022-04-18,,,empty,"4/18: drone--blue paper 6, collapsed, 4/26: paper gone, 5/2: gone" +2022,joule,422,greg,2022-04-26,,,empty,"4/18: drone--blue paper 6, collapsed, 4/26: paper gone, 5/2: gone" +2022,joule,422,greg,2022-05-02,,,collapsed,"4/18: drone--blue paper 6, collapsed, 4/26: paper gone, 5/2: gone" +2022,joule,422,greg,2022-05-09,,,empty,"4/18: drone--blue paper 6, collapsed, 4/26: paper gone, 5/2: gone" +2022,joule,908,greg,2022-02-21,,,,"4/18: drone--orange paper 7, 4/26: paper removed" +2022,joule,908,greg,2022-02-28,2,,incubating,"4/18: drone--orange paper 7, 4/26: paper removed" +2022,joule,908,greg,2022-03-07,,,empty,"4/18: drone--orange paper 7, 4/26: paper removed" +2022,joule,908,greg,2022-03-14,,,empty,"4/18: drone--orange paper 7, 4/26: paper removed" +2022,joule,908,greg,2022-03-21,,,empty,"4/18: drone--orange paper 7, 4/26: paper removed" +2022,joule,908,greg,2022-03-28,,,empty,"4/18: drone--orange paper 7, 4/26: paper removed" +2022,joule,908,greg,2022-04-05,,,empty,"4/18: drone--orange paper 7, 4/26: paper removed" +2022,joule,908,greg,2022-04-11,,,empty,"4/18: drone--orange paper 7, 4/26: paper removed" +2022,joule,908,greg,2022-04-18,,,empty,"4/18: drone--orange paper 7, 4/26: paper removed" +2022,joule,908,greg,2022-04-26,,,empty,"4/18: drone--orange paper 7, 4/26: paper removed" +2022,joule,908,greg,2022-05-02,,,empty,"4/18: drone--orange paper 7, 4/26: paper removed" +2022,joule,908,greg,2022-05-09,,,empty,"4/18: drone--orange paper 7, 4/26: paper removed" +2022,joule,94,greg,2022-02-21,,,, +2022,joule,94,greg,2022-02-28,,,, +2022,joule,94,greg,2022-03-07,3,,incubating, +2022,joule,94,greg,2022-03-14,3,,incubating, +2022,joule,94,greg,2022-03-21,1,2,hatching, +2022,joule,94,greg,2022-03-28,,3,nestling, +2022,joule,94,greg,2022-04-05,,2,nestling, +2022,joule,94,greg,2022-04-11,,2,nestling, +2022,joule,94,greg,2022-04-18,,2,nestling, +2022,joule,94,greg,2022-04-26,,,empty, +2022,joule,94,greg,2022-05-02,,,empty, +2022,joule,94,greg,2022-05-09,,,empty, +2022,joule,96,greg,2022-02-21,,,,"Near 906. 4/5: young dry chicks, 4/18: drone--yellow paper beside 5, 4/26: paper removed, 5/2: 2c big branchlings" +2022,joule,96,greg,2022-02-28,,,,"Near 906. 4/5: young dry chicks, 4/18: drone--yellow paper beside 5, 4/26: paper removed, 5/2: 2c big branchlings" +2022,joule,96,greg,2022-03-07,1,,incubating,"Near 906. 4/5: young dry chicks, 4/18: drone--yellow paper beside 5, 4/26: paper removed, 5/2: 2c big branchlings" +2022,joule,96,greg,2022-03-14,2,,incubating,"Near 906. 4/5: young dry chicks, 4/18: drone--yellow paper beside 5, 4/26: paper removed, 5/2: 2c big branchlings" +2022,joule,96,greg,2022-03-21,2,,incubating,"Near 906. 4/5: young dry chicks, 4/18: drone--yellow paper beside 5, 4/26: paper removed, 5/2: 2c big branchlings" +2022,joule,96,greg,2022-03-28,2,,incubating,"Near 906. 4/5: young dry chicks, 4/18: drone--yellow paper beside 5, 4/26: paper removed, 5/2: 2c big branchlings" +2022,joule,96,greg,2022-04-05,,2,nestling,"Near 906. 4/5: young dry chicks, 4/18: drone--yellow paper beside 5, 4/26: paper removed, 5/2: 2c big branchlings" +2022,joule,96,greg,2022-04-11,,2,nestling,"Near 906. 4/5: young dry chicks, 4/18: drone--yellow paper beside 5, 4/26: paper removed, 5/2: 2c big branchlings" +2022,joule,96,greg,2022-04-18,,2,nestling,"Near 906. 4/5: young dry chicks, 4/18: drone--yellow paper beside 5, 4/26: paper removed, 5/2: 2c big branchlings" +2022,joule,96,greg,2022-04-26,,2,nestling,"Near 906. 4/5: young dry chicks, 4/18: drone--yellow paper beside 5, 4/26: paper removed, 5/2: 2c big branchlings" +2022,joule,96,greg,2022-05-02,,2,nestling,"Near 906. 4/5: young dry chicks, 4/18: drone--yellow paper beside 5, 4/26: paper removed, 5/2: 2c big branchlings" +2022,joule,96,greg,2022-05-09,,,empty,"Near 906. 4/5: young dry chicks, 4/18: drone--yellow paper beside 5, 4/26: paper removed, 5/2: 2c big branchlings" +2022,joule,175,greg,2022-02-21,,,,"3/21: eggshells on nest and ground, 4/11: drone--red paper, 4/18: paper removed" +2022,joule,175,greg,2022-02-28,,,,"3/21: eggshells on nest and ground, 4/11: drone--red paper, 4/18: paper removed" +2022,joule,175,greg,2022-03-07,,,,"3/21: eggshells on nest and ground, 4/11: drone--red paper, 4/18: paper removed" +2022,joule,175,greg,2022-03-14,3,,incubating,"3/21: eggshells on nest and ground, 4/11: drone--red paper, 4/18: paper removed" +2022,joule,175,greg,2022-03-21,,,empty,"3/21: eggshells on nest and ground, 4/11: drone--red paper, 4/18: paper removed" +2022,joule,175,greg,2022-03-28,,,empty,"3/21: eggshells on nest and ground, 4/11: drone--red paper, 4/18: paper removed" +2022,joule,175,greg,2022-04-05,,,empty,"3/21: eggshells on nest and ground, 4/11: drone--red paper, 4/18: paper removed" +2022,joule,175,greg,2022-04-11,,,empty,"3/21: eggshells on nest and ground, 4/11: drone--red paper, 4/18: paper removed" +2022,joule,175,greg,2022-04-18,,,empty,"3/21: eggshells on nest and ground, 4/11: drone--red paper, 4/18: paper removed" +2022,joule,175,greg,2022-04-26,,,empty,"3/21: eggshells on nest and ground, 4/11: drone--red paper, 4/18: paper removed" +2022,joule,175,greg,2022-05-02,,,empty,"3/21: eggshells on nest and ground, 4/11: drone--red paper, 4/18: paper removed" +2022,joule,175,greg,2022-05-09,,,empty,"3/21: eggshells on nest and ground, 4/11: drone--red paper, 4/18: paper removed" +2022,joule,177,greg,2022-02-21,,,,"Behind flagging. 4/11: drone--blue flagging, 4/18: blue paper removed, 5/2: gone, 5/9: gone" +2022,joule,177,greg,2022-02-28,,,,"Behind flagging. 4/11: drone--blue flagging, 4/18: blue paper removed, 5/2: gone, 5/9: gone" +2022,joule,177,greg,2022-03-07,,,,"Behind flagging. 4/11: drone--blue flagging, 4/18: blue paper removed, 5/2: gone, 5/9: gone" +2022,joule,177,greg,2022-03-14,3,,incubating,"Behind flagging. 4/11: drone--blue flagging, 4/18: blue paper removed, 5/2: gone, 5/9: gone" +2022,joule,177,greg,2022-03-21,,,empty,"Behind flagging. 4/11: drone--blue flagging, 4/18: blue paper removed, 5/2: gone, 5/9: gone" +2022,joule,177,greg,2022-03-28,,,empty,"Behind flagging. 4/11: drone--blue flagging, 4/18: blue paper removed, 5/2: gone, 5/9: gone" +2022,joule,177,greg,2022-04-05,,,empty,"Behind flagging. 4/11: drone--blue flagging, 4/18: blue paper removed, 5/2: gone, 5/9: gone" +2022,joule,177,greg,2022-04-11,,,empty,"Behind flagging. 4/11: drone--blue flagging, 4/18: blue paper removed, 5/2: gone, 5/9: gone" +2022,joule,177,greg,2022-04-18,,,empty,"Behind flagging. 4/11: drone--blue flagging, 4/18: blue paper removed, 5/2: gone, 5/9: gone" +2022,joule,177,greg,2022-04-26,,,empty,"Behind flagging. 4/11: drone--blue flagging, 4/18: blue paper removed, 5/2: gone, 5/9: gone" +2022,joule,177,greg,2022-05-02,,,collapsed,"Behind flagging. 4/11: drone--blue flagging, 4/18: blue paper removed, 5/2: gone, 5/9: gone" +2022,joule,177,greg,2022-05-09,,,collapsed,"Behind flagging. 4/11: drone--blue flagging, 4/18: blue paper removed, 5/2: gone, 5/9: gone" +2022,joule,179,greg,2022-02-21,,,,"4/26: nest gone, 5/2: gone, 5/9: gone" +2022,joule,179,greg,2022-02-28,,,,"4/26: nest gone, 5/2: gone, 5/9: gone" +2022,joule,179,greg,2022-03-07,,,,"4/26: nest gone, 5/2: gone, 5/9: gone" +2022,joule,179,greg,2022-03-14,2,,incubating,"4/26: nest gone, 5/2: gone, 5/9: gone" +2022,joule,179,greg,2022-03-21,2,,incubating,"4/26: nest gone, 5/2: gone, 5/9: gone" +2022,joule,179,greg,2022-03-28,,,empty,"4/26: nest gone, 5/2: gone, 5/9: gone" +2022,joule,179,greg,2022-04-05,,,empty,"4/26: nest gone, 5/2: gone, 5/9: gone" +2022,joule,179,greg,2022-04-11,,,empty,"4/26: nest gone, 5/2: gone, 5/9: gone" +2022,joule,179,greg,2022-04-18,,,empty,"4/26: nest gone, 5/2: gone, 5/9: gone" +2022,joule,179,greg,2022-04-26,,,collapsed,"4/26: nest gone, 5/2: gone, 5/9: gone" +2022,joule,179,greg,2022-05-02,,,collapsed,"4/26: nest gone, 5/2: gone, 5/9: gone" +2022,joule,179,greg,2022-05-09,,,collapsed,"4/26: nest gone, 5/2: gone, 5/9: gone" +2022,start_mel,34,greg,2022-02-22,3,,incubating,"3/22: pulled" +2022,start_mel,34,greg,2022-03-02,,,empty,"3/22: pulled" +2022,start_mel,34,greg,2022-03-22,,,,"3/22: pulled" +2022,start_mel,34,greg,2022-03-30,,,,"3/22: pulled" +2022,start_mel,34,greg,2022-04-06,,,,"3/22: pulled" +2022,start_mel,34,greg,2022-04-13,,,,"3/22: pulled" +2022,start_mel,34,greg,2022-04-20,,,,"3/22: pulled" +2022,start_mel,34,greg,2022-04-27,,,,"3/22: pulled" +2022,start_mel,34,greg,2022-05-04,,,,"3/22: pulled" +2022,start_mel,34,greg,2022-05-13,,,,"3/22: pulled" +2022,start_mel,34,greg,2022-05-19,,,,"3/22: pulled" +2022,start_mel,83,greg,2022-02-22,1,,incubating,"3/22: pulled" +2022,start_mel,83,greg,2022-03-02,2,,incubating,"3/22: pulled" +2022,start_mel,83,greg,2022-03-22,,,empty,"3/22: pulled" +2022,start_mel,83,greg,2022-03-30,,,,"3/22: pulled" +2022,start_mel,83,greg,2022-04-06,,,,"3/22: pulled" +2022,start_mel,83,greg,2022-04-13,,,,"3/22: pulled" +2022,start_mel,83,greg,2022-04-20,,,,"3/22: pulled" +2022,start_mel,83,greg,2022-04-27,,,,"3/22: pulled" +2022,start_mel,83,greg,2022-05-04,,,,"3/22: pulled" +2022,start_mel,83,greg,2022-05-13,,,,"3/22: pulled" +2022,start_mel,83,greg,2022-05-19,,,,"3/22: pulled" +2022,start_mel,36,greg,2022-02-22,3,,incubating,"4/20: blue paper in nest, 4/27: paper removed, 5/26: blue paper" +2022,start_mel,36,greg,2022-03-02,,,empty,"4/20: blue paper in nest, 4/27: paper removed, 5/26: blue paper" +2022,start_mel,36,greg,2022-03-22,,,empty,"4/20: blue paper in nest, 4/27: paper removed, 5/26: blue paper" +2022,start_mel,36,greg,2022-03-30,,,empty,"4/20: blue paper in nest, 4/27: paper removed, 5/26: blue paper" +2022,start_mel,36,greg,2022-04-06,,,empty,"4/20: blue paper in nest, 4/27: paper removed, 5/26: blue paper" +2022,start_mel,36,greg,2022-04-13,,,empty,"4/20: blue paper in nest, 4/27: paper removed, 5/26: blue paper" +2022,start_mel,36,greg,2022-04-20,,,empty,"4/20: blue paper in nest, 4/27: paper removed, 5/26: blue paper" +2022,start_mel,36,greg,2022-04-27,,,empty,"4/20: blue paper in nest, 4/27: paper removed, 5/26: blue paper" +2022,start_mel,36,greg,2022-05-04,,,empty,"4/20: blue paper in nest, 4/27: paper removed, 5/26: blue paper" +2022,start_mel,36,greg,2022-05-13,,,empty,"4/20: blue paper in nest, 4/27: paper removed, 5/26: blue paper" +2022,start_mel,36,greg,2022-05-19,,,empty,"4/20: blue paper in nest, 4/27: paper removed, 5/26: blue paper" +2022,start_mel,38,greg,2022-02-22,1,,incubating,"3/22: pulled, gone" +2022,start_mel,38,greg,2022-03-02,,,empty,"3/22: pulled, gone" +2022,start_mel,38,greg,2022-03-22,,,,"3/22: pulled, gone" +2022,start_mel,38,greg,2022-03-30,,,,"3/22: pulled, gone" +2022,start_mel,38,greg,2022-04-06,,,,"3/22: pulled, gone" +2022,start_mel,38,greg,2022-04-13,,,,"3/22: pulled, gone" +2022,start_mel,38,greg,2022-04-20,,,,"3/22: pulled, gone" +2022,start_mel,38,greg,2022-04-27,,,,"3/22: pulled, gone" +2022,start_mel,38,greg,2022-05-04,,,,"3/22: pulled, gone" +2022,start_mel,38,greg,2022-05-13,,,,"3/22: pulled, gone" +2022,start_mel,38,greg,2022-05-19,,,,"3/22: pulled, gone" +2022,start_mel,40,greg,2022-02-22,3,,incubating,"3/2: eggshells on ground, 3/22: collapsed, pulled" +2022,start_mel,40,greg,2022-03-02,,,empty,"3/2: eggshells on ground, 3/22: collapsed, pulled" +2022,start_mel,40,greg,2022-03-22,,,,"3/2: eggshells on ground, 3/22: collapsed, pulled" +2022,start_mel,40,greg,2022-03-30,,,,"3/2: eggshells on ground, 3/22: collapsed, pulled" +2022,start_mel,40,greg,2022-04-06,,,,"3/2: eggshells on ground, 3/22: collapsed, pulled" +2022,start_mel,40,greg,2022-04-13,,,,"3/2: eggshells on ground, 3/22: collapsed, pulled" +2022,start_mel,40,greg,2022-04-20,,,,"3/2: eggshells on ground, 3/22: collapsed, pulled" +2022,start_mel,40,greg,2022-04-27,,,,"3/2: eggshells on ground, 3/22: collapsed, pulled" +2022,start_mel,40,greg,2022-05-04,,,,"3/2: eggshells on ground, 3/22: collapsed, pulled" +2022,start_mel,40,greg,2022-05-13,,,,"3/2: eggshells on ground, 3/22: collapsed, pulled" +2022,start_mel,40,greg,2022-05-19,,,,"3/2: eggshells on ground, 3/22: collapsed, pulled" +2022,start_mel,85,greg,2022-02-22,1,,incubating,"3/2: eggshell remnants in nest, 3/22: definitely the same nest, 4/20: pink in nest, 4/27: paper removed, 5/26: yellow paper 2 pieces" +2022,start_mel,85,greg,2022-03-02,,,empty,"3/2: eggshell remnants in nest, 3/22: definitely the same nest, 4/20: pink in nest, 4/27: paper removed, 5/26: yellow paper 2 pieces" +2022,start_mel,85,greg,2022-03-22,2,,incubating,"3/2: eggshell remnants in nest, 3/22: definitely the same nest, 4/20: pink in nest, 4/27: paper removed, 5/26: yellow paper 2 pieces" +2022,start_mel,85,greg,2022-03-30,2,,incubating,"3/2: eggshell remnants in nest, 3/22: definitely the same nest, 4/20: pink in nest, 4/27: paper removed, 5/26: yellow paper 2 pieces" +2022,start_mel,85,greg,2022-04-06,,,empty,"3/2: eggshell remnants in nest, 3/22: definitely the same nest, 4/20: pink in nest, 4/27: paper removed, 5/26: yellow paper 2 pieces" +2022,start_mel,85,greg,2022-04-13,,,empty,"3/2: eggshell remnants in nest, 3/22: definitely the same nest, 4/20: pink in nest, 4/27: paper removed, 5/26: yellow paper 2 pieces" +2022,start_mel,85,greg,2022-04-20,,,empty,"3/2: eggshell remnants in nest, 3/22: definitely the same nest, 4/20: pink in nest, 4/27: paper removed, 5/26: yellow paper 2 pieces" +2022,start_mel,85,greg,2022-04-27,,,empty,"3/2: eggshell remnants in nest, 3/22: definitely the same nest, 4/20: pink in nest, 4/27: paper removed, 5/26: yellow paper 2 pieces" +2022,start_mel,85,greg,2022-05-04,,,empty,"3/2: eggshell remnants in nest, 3/22: definitely the same nest, 4/20: pink in nest, 4/27: paper removed, 5/26: yellow paper 2 pieces" +2022,start_mel,85,greg,2022-05-13,,,empty,"3/2: eggshell remnants in nest, 3/22: definitely the same nest, 4/20: pink in nest, 4/27: paper removed, 5/26: yellow paper 2 pieces" +2022,start_mel,85,greg,2022-05-19,,,empty,"3/2: eggshell remnants in nest, 3/22: definitely the same nest, 4/20: pink in nest, 4/27: paper removed, 5/26: yellow paper 2 pieces" +2022,start_mel,42,greg,2022-02-22,,,,"3/2: was already flagged but not recorded before, 4/20: blue in nest, 4/27: paper removed, 5/26: blue paper and blue flagging to the south 3'" +2022,start_mel,42,greg,2022-03-02,2,,incubating,"3/2: was already flagged but not recorded before, 4/20: blue in nest, 4/27: paper removed, 5/26: blue paper and blue flagging to the south 3'" +2022,start_mel,42,greg,2022-03-22,,,empty,"3/2: was already flagged but not recorded before, 4/20: blue in nest, 4/27: paper removed, 5/26: blue paper and blue flagging to the south 3'" +2022,start_mel,42,greg,2022-03-30,,,empty,"3/2: was already flagged but not recorded before, 4/20: blue in nest, 4/27: paper removed, 5/26: blue paper and blue flagging to the south 3'" +2022,start_mel,42,greg,2022-04-06,,,empty,"3/2: was already flagged but not recorded before, 4/20: blue in nest, 4/27: paper removed, 5/26: blue paper and blue flagging to the south 3'" +2022,start_mel,42,greg,2022-04-13,,,empty,"3/2: was already flagged but not recorded before, 4/20: blue in nest, 4/27: paper removed, 5/26: blue paper and blue flagging to the south 3'" +2022,start_mel,42,greg,2022-04-20,,,empty,"3/2: was already flagged but not recorded before, 4/20: blue in nest, 4/27: paper removed, 5/26: blue paper and blue flagging to the south 3'" +2022,start_mel,42,greg,2022-04-27,,,empty,"3/2: was already flagged but not recorded before, 4/20: blue in nest, 4/27: paper removed, 5/26: blue paper and blue flagging to the south 3'" +2022,start_mel,42,greg,2022-05-04,,,empty,"3/2: was already flagged but not recorded before, 4/20: blue in nest, 4/27: paper removed, 5/26: blue paper and blue flagging to the south 3'" +2022,start_mel,42,greg,2022-05-13,,,empty,"3/2: was already flagged but not recorded before, 4/20: blue in nest, 4/27: paper removed, 5/26: blue paper and blue flagging to the south 3'" +2022,start_mel,42,greg,2022-05-19,,,empty,"3/2: was already flagged but not recorded before, 4/20: blue in nest, 4/27: paper removed, 5/26: blue paper and blue flagging to the south 3'" +2022,start_mel,106,greg,2022-02-22,,,,"Before 309. 4/20: blue in nest, 4/27: nest gone" +2022,start_mel,106,greg,2022-03-02,,,,"Before 309. 4/20: blue in nest, 4/27: nest gone" +2022,start_mel,106,greg,2022-03-22,2,,incubating,"Before 309. 4/20: blue in nest, 4/27: nest gone" +2022,start_mel,106,greg,2022-03-30,,,empty,"Before 309. 4/20: blue in nest, 4/27: nest gone" +2022,start_mel,106,greg,2022-04-06,,,empty,"Before 309. 4/20: blue in nest, 4/27: nest gone" +2022,start_mel,106,greg,2022-04-13,,,empty,"Before 309. 4/20: blue in nest, 4/27: nest gone" +2022,start_mel,106,greg,2022-04-20,,,empty,"Before 309. 4/20: blue in nest, 4/27: nest gone" +2022,start_mel,106,greg,2022-04-27,,,,"Before 309. 4/20: blue in nest, 4/27: nest gone" +2022,start_mel,106,greg,2022-05-04,,,empty,"Before 309. 4/20: blue in nest, 4/27: nest gone" +2022,start_mel,106,greg,2022-05-13,,,empty,"Before 309. 4/20: blue in nest, 4/27: nest gone" +2022,start_mel,106,greg,2022-05-19,,,empty,"Before 309. 4/20: blue in nest, 4/27: nest gone" +2022,start_mel,183,greg,2022-02-22,,,,"Before 309. 4/13: youngest dry, probably hatched 4/12, 4/27: chicks branch" +2022,start_mel,183,greg,2022-03-02,,,,"Before 309. 4/13: youngest dry, probably hatched 4/12, 4/27: chicks branch" +2022,start_mel,183,greg,2022-03-22,2,,incubating,"Before 309. 4/13: youngest dry, probably hatched 4/12, 4/27: chicks branch" +2022,start_mel,183,greg,2022-03-30,3,,incubating,"Before 309. 4/13: youngest dry, probably hatched 4/12, 4/27: chicks branch" +2022,start_mel,183,greg,2022-04-06,3,,incubating,"Before 309. 4/13: youngest dry, probably hatched 4/12, 4/27: chicks branch" +2022,start_mel,183,greg,2022-04-13,,3,nestling,"Before 309. 4/13: youngest dry, probably hatched 4/12, 4/27: chicks branch" +2022,start_mel,183,greg,2022-04-20,,3,nestling,"Before 309. 4/13: youngest dry, probably hatched 4/12, 4/27: chicks branch" +2022,start_mel,183,greg,2022-04-27,,2,branchling,"Before 309. 4/13: youngest dry, probably hatched 4/12, 4/27: chicks branch" +2022,start_mel,183,greg,2022-05-04,,,empty,"Before 309. 4/13: youngest dry, probably hatched 4/12, 4/27: chicks branch" +2022,start_mel,183,greg,2022-05-13,,,empty,"Before 309. 4/13: youngest dry, probably hatched 4/12, 4/27: chicks branch" +2022,start_mel,183,greg,2022-05-19,,,empty,"Before 309. 4/13: youngest dry, probably hatched 4/12, 4/27: chicks branch" +2022,start_mel,303,greg,2022-02-22,,,,"Before 309. 3/30: eggshells on ground, 4/20: pink in nest, 4/27: paper removed, 5/26: blue paper and blue flagging" +2022,start_mel,303,greg,2022-03-02,,,,"Before 309. 3/30: eggshells on ground, 4/20: pink in nest, 4/27: paper removed, 5/26: blue paper and blue flagging" +2022,start_mel,303,greg,2022-03-22,1,,incubating,"Before 309. 3/30: eggshells on ground, 4/20: pink in nest, 4/27: paper removed, 5/26: blue paper and blue flagging" +2022,start_mel,303,greg,2022-03-30,,,empty,"Before 309. 3/30: eggshells on ground, 4/20: pink in nest, 4/27: paper removed, 5/26: blue paper and blue flagging" +2022,start_mel,303,greg,2022-04-06,,,empty,"Before 309. 3/30: eggshells on ground, 4/20: pink in nest, 4/27: paper removed, 5/26: blue paper and blue flagging" +2022,start_mel,303,greg,2022-04-13,,,empty,"Before 309. 3/30: eggshells on ground, 4/20: pink in nest, 4/27: paper removed, 5/26: blue paper and blue flagging" +2022,start_mel,303,greg,2022-04-20,,,empty,"Before 309. 3/30: eggshells on ground, 4/20: pink in nest, 4/27: paper removed, 5/26: blue paper and blue flagging" +2022,start_mel,303,greg,2022-04-27,,,empty,"Before 309. 3/30: eggshells on ground, 4/20: pink in nest, 4/27: paper removed, 5/26: blue paper and blue flagging" +2022,start_mel,303,greg,2022-05-04,,,empty,"Before 309. 3/30: eggshells on ground, 4/20: pink in nest, 4/27: paper removed, 5/26: blue paper and blue flagging" +2022,start_mel,303,greg,2022-05-13,,,empty,"Before 309. 3/30: eggshells on ground, 4/20: pink in nest, 4/27: paper removed, 5/26: blue paper and blue flagging" +2022,start_mel,303,greg,2022-05-19,,,empty,"Before 309. 3/30: eggshells on ground, 4/20: pink in nest, 4/27: paper removed, 5/26: blue paper and blue flagging" +2022,start_mel,185,greg,2022-02-22,,,,"Before 309. 4/20: blue in nest, 4/27: paper removed, 5/26: orange paper" +2022,start_mel,185,greg,2022-03-02,,,,"Before 309. 4/20: blue in nest, 4/27: paper removed, 5/26: orange paper" +2022,start_mel,185,greg,2022-03-22,3,,incubating,"Before 309. 4/20: blue in nest, 4/27: paper removed, 5/26: orange paper" +2022,start_mel,185,greg,2022-03-30,3,,incubating,"Before 309. 4/20: blue in nest, 4/27: paper removed, 5/26: orange paper" +2022,start_mel,185,greg,2022-04-06,,,empty,"Before 309. 4/20: blue in nest, 4/27: paper removed, 5/26: orange paper" +2022,start_mel,185,greg,2022-04-13,,,empty,"Before 309. 4/20: blue in nest, 4/27: paper removed, 5/26: orange paper" +2022,start_mel,185,greg,2022-04-20,,,empty,"Before 309. 4/20: blue in nest, 4/27: paper removed, 5/26: orange paper" +2022,start_mel,185,greg,2022-04-27,,,empty,"Before 309. 4/20: blue in nest, 4/27: paper removed, 5/26: orange paper" +2022,start_mel,185,greg,2022-05-04,,,empty,"Before 309. 4/20: blue in nest, 4/27: paper removed, 5/26: orange paper" +2022,start_mel,185,greg,2022-05-13,,,empty,"Before 309. 4/20: blue in nest, 4/27: paper removed, 5/26: orange paper" +2022,start_mel,185,greg,2022-05-19,,,empty,"Before 309. 4/20: blue in nest, 4/27: paper removed, 5/26: orange paper" +2022,start_mel,305,greg,2022-02-22,,,,"Before 309. 4/20: blue in nest" +2022,start_mel,305,greg,2022-03-02,,,,"Before 309. 4/20: blue in nest" +2022,start_mel,305,greg,2022-03-22,2,,incubating,"Before 309. 4/20: blue in nest" +2022,start_mel,305,greg,2022-03-30,,,empty,"Before 309. 4/20: blue in nest" +2022,start_mel,305,greg,2022-04-06,,,empty,"Before 309. 4/20: blue in nest" +2022,start_mel,305,greg,2022-04-13,,,missed,"Before 309. 4/20: blue in nest" +2022,start_mel,305,greg,2022-04-20,,,empty,"Before 309. 4/20: blue in nest" +2022,start_mel,305,greg,2022-04-27,,,empty,"Before 309. 4/20: blue in nest" +2022,start_mel,305,greg,2022-05-04,,,empty,"Before 309. 4/20: blue in nest" +2022,start_mel,305,greg,2022-05-13,,,empty,"Before 309. 4/20: blue in nest" +2022,start_mel,305,greg,2022-05-19,,,empty,"Before 309. 4/20: blue in nest" +2022,start_mel,187,greg,2022-02-22,,,,"Before 309. 4/20: pink in nest, 4/27: paper removed, 5/26: blue paper, pond apple" +2022,start_mel,187,greg,2022-03-02,,,,"Before 309. 4/20: pink in nest, 4/27: paper removed, 5/26: blue paper, pond apple" +2022,start_mel,187,greg,2022-03-22,2,,incubating,"Before 309. 4/20: pink in nest, 4/27: paper removed, 5/26: blue paper, pond apple" +2022,start_mel,187,greg,2022-03-30,2,,incubating,"Before 309. 4/20: pink in nest, 4/27: paper removed, 5/26: blue paper, pond apple" +2022,start_mel,187,greg,2022-04-06,2,,incubating,"Before 309. 4/20: pink in nest, 4/27: paper removed, 5/26: blue paper, pond apple" +2022,start_mel,187,greg,2022-04-13,,,empty,"Before 309. 4/20: pink in nest, 4/27: paper removed, 5/26: blue paper, pond apple" +2022,start_mel,187,greg,2022-04-20,,,empty,"Before 309. 4/20: pink in nest, 4/27: paper removed, 5/26: blue paper, pond apple" +2022,start_mel,187,greg,2022-04-27,,,empty,"Before 309. 4/20: pink in nest, 4/27: paper removed, 5/26: blue paper, pond apple" +2022,start_mel,187,greg,2022-05-04,,,empty,"Before 309. 4/20: pink in nest, 4/27: paper removed, 5/26: blue paper, pond apple" +2022,start_mel,187,greg,2022-05-13,,,empty,"Before 309. 4/20: pink in nest, 4/27: paper removed, 5/26: blue paper, pond apple" +2022,start_mel,187,greg,2022-05-19,,,empty,"Before 309. 4/20: pink in nest, 4/27: paper removed, 5/26: blue paper, pond apple" +2022,start_mel,307,greg,2022-02-22,,,,"Before 309. 4/6: egg looks dead, 4/13: in sea myrtle, 4/20: pink in nest, 4/27: paper removed, 5/26: pink paper in and beside to south 10'" +2022,start_mel,307,greg,2022-03-02,,,,"Before 309. 4/6: egg looks dead, 4/13: in sea myrtle, 4/20: pink in nest, 4/27: paper removed, 5/26: pink paper in and beside to south 10'" +2022,start_mel,307,greg,2022-03-22,1,,incubating,"Before 309. 4/6: egg looks dead, 4/13: in sea myrtle, 4/20: pink in nest, 4/27: paper removed, 5/26: pink paper in and beside to south 10'" +2022,start_mel,307,greg,2022-03-30,1,,incubating,"Before 309. 4/6: egg looks dead, 4/13: in sea myrtle, 4/20: pink in nest, 4/27: paper removed, 5/26: pink paper in and beside to south 10'" +2022,start_mel,307,greg,2022-04-06,1,,incubating,"Before 309. 4/6: egg looks dead, 4/13: in sea myrtle, 4/20: pink in nest, 4/27: paper removed, 5/26: pink paper in and beside to south 10'" +2022,start_mel,307,greg,2022-04-13,1,,incubating,"Before 309. 4/6: egg looks dead, 4/13: in sea myrtle, 4/20: pink in nest, 4/27: paper removed, 5/26: pink paper in and beside to south 10'" +2022,start_mel,307,greg,2022-04-20,,,empty,"Before 309. 4/6: egg looks dead, 4/13: in sea myrtle, 4/20: pink in nest, 4/27: paper removed, 5/26: pink paper in and beside to south 10'" +2022,start_mel,307,greg,2022-04-27,,,empty,"Before 309. 4/6: egg looks dead, 4/13: in sea myrtle, 4/20: pink in nest, 4/27: paper removed, 5/26: pink paper in and beside to south 10'" +2022,start_mel,307,greg,2022-05-04,,,empty,"Before 309. 4/6: egg looks dead, 4/13: in sea myrtle, 4/20: pink in nest, 4/27: paper removed, 5/26: pink paper in and beside to south 10'" +2022,start_mel,307,greg,2022-05-13,,,empty,"Before 309. 4/6: egg looks dead, 4/13: in sea myrtle, 4/20: pink in nest, 4/27: paper removed, 5/26: pink paper in and beside to south 10'" +2022,start_mel,307,greg,2022-05-19,,,empty,"Before 309. 4/6: egg looks dead, 4/13: in sea myrtle, 4/20: pink in nest, 4/27: paper removed, 5/26: pink paper in and beside to south 10'" +2022,start_mel,189,greg,2022-02-22,,,,"4/6: collapsed, 4/20: pink in nest, 4/27: paper removed, 5/4: gone, 5/26: right beside 187 - same pond apple" +2022,start_mel,189,greg,2022-03-02,,,,"4/6: collapsed, 4/20: pink in nest, 4/27: paper removed, 5/4: gone, 5/26: right beside 187 - same pond apple" +2022,start_mel,189,greg,2022-03-22,2,,incubating,"4/6: collapsed, 4/20: pink in nest, 4/27: paper removed, 5/4: gone, 5/26: right beside 187 - same pond apple" +2022,start_mel,189,greg,2022-03-30,2,,incubating,"4/6: collapsed, 4/20: pink in nest, 4/27: paper removed, 5/4: gone, 5/26: right beside 187 - same pond apple" +2022,start_mel,189,greg,2022-04-06,,,empty,"4/6: collapsed, 4/20: pink in nest, 4/27: paper removed, 5/4: gone, 5/26: right beside 187 - same pond apple" +2022,start_mel,189,greg,2022-04-13,,,,"4/6: collapsed, 4/20: pink in nest, 4/27: paper removed, 5/4: gone, 5/26: right beside 187 - same pond apple" +2022,start_mel,189,greg,2022-04-20,,,,"4/6: collapsed, 4/20: pink in nest, 4/27: paper removed, 5/4: gone, 5/26: right beside 187 - same pond apple" +2022,start_mel,189,greg,2022-04-27,,,,"4/6: collapsed, 4/20: pink in nest, 4/27: paper removed, 5/4: gone, 5/26: right beside 187 - same pond apple" +2022,start_mel,189,greg,2022-05-04,,,,"4/6: collapsed, 4/20: pink in nest, 4/27: paper removed, 5/4: gone, 5/26: right beside 187 - same pond apple" +2022,start_mel,189,greg,2022-05-13,,,,"4/6: collapsed, 4/20: pink in nest, 4/27: paper removed, 5/4: gone, 5/26: right beside 187 - same pond apple" +2022,start_mel,189,greg,2022-05-19,,,,"4/6: collapsed, 4/20: pink in nest, 4/27: paper removed, 5/4: gone, 5/26: right beside 187 - same pond apple" +2022,start_mel,309,greg,2022-02-22,,,,"Next to failed 34. 4/20: blue in nest, 4/27: paper removed 5/26: 2 pieces of yellow paper" +2022,start_mel,309,greg,2022-03-02,,,,"Next to failed 34. 4/20: blue in nest, 4/27: paper removed 5/26: 2 pieces of yellow paper" +2022,start_mel,309,greg,2022-03-22,3,,incubating,"Next to failed 34. 4/20: blue in nest, 4/27: paper removed 5/26: 2 pieces of yellow paper" +2022,start_mel,309,greg,2022-03-30,,,empty,"Next to failed 34. 4/20: blue in nest, 4/27: paper removed 5/26: 2 pieces of yellow paper" +2022,start_mel,309,greg,2022-04-06,,,empty,"Next to failed 34. 4/20: blue in nest, 4/27: paper removed 5/26: 2 pieces of yellow paper" +2022,start_mel,309,greg,2022-04-13,,,empty,"Next to failed 34. 4/20: blue in nest, 4/27: paper removed 5/26: 2 pieces of yellow paper" +2022,start_mel,309,greg,2022-04-20,,,empty,"Next to failed 34. 4/20: blue in nest, 4/27: paper removed 5/26: 2 pieces of yellow paper" +2022,start_mel,309,greg,2022-04-27,,,empty,"Next to failed 34. 4/20: blue in nest, 4/27: paper removed 5/26: 2 pieces of yellow paper" +2022,start_mel,309,greg,2022-05-04,,,empty,"Next to failed 34. 4/20: blue in nest, 4/27: paper removed 5/26: 2 pieces of yellow paper" +2022,start_mel,309,greg,2022-05-13,,,empty,"Next to failed 34. 4/20: blue in nest, 4/27: paper removed 5/26: 2 pieces of yellow paper" +2022,start_mel,309,greg,2022-05-19,,,empty,"Next to failed 34. 4/20: blue in nest, 4/27: paper removed 5/26: 2 pieces of yellow paper" +2022,start_mel,191,greg,2022-02-22,,,,"Next to failed 83. 4/20: pink in nest, 4/27: paper removed, 5/26: orange paper in nest and orange paper 6' to east" +2022,start_mel,191,greg,2022-03-02,,,,"Next to failed 83. 4/20: pink in nest, 4/27: paper removed, 5/26: orange paper in nest and orange paper 6' to east" +2022,start_mel,191,greg,2022-03-22,3,,incubating,"Next to failed 83. 4/20: pink in nest, 4/27: paper removed, 5/26: orange paper in nest and orange paper 6' to east" +2022,start_mel,191,greg,2022-03-30,3,,incubating,"Next to failed 83. 4/20: pink in nest, 4/27: paper removed, 5/26: orange paper in nest and orange paper 6' to east" +2022,start_mel,191,greg,2022-04-06,,,empty,"Next to failed 83. 4/20: pink in nest, 4/27: paper removed, 5/26: orange paper in nest and orange paper 6' to east" +2022,start_mel,191,greg,2022-04-13,,,empty,"Next to failed 83. 4/20: pink in nest, 4/27: paper removed, 5/26: orange paper in nest and orange paper 6' to east" +2022,start_mel,191,greg,2022-04-20,,,empty,"Next to failed 83. 4/20: pink in nest, 4/27: paper removed, 5/26: orange paper in nest and orange paper 6' to east" +2022,start_mel,191,greg,2022-04-27,,,empty,"Next to failed 83. 4/20: pink in nest, 4/27: paper removed, 5/26: orange paper in nest and orange paper 6' to east" +2022,start_mel,191,greg,2022-05-04,,,empty,"Next to failed 83. 4/20: pink in nest, 4/27: paper removed, 5/26: orange paper in nest and orange paper 6' to east" +2022,start_mel,191,greg,2022-05-13,,,empty,"Next to failed 83. 4/20: pink in nest, 4/27: paper removed, 5/26: orange paper in nest and orange paper 6' to east" +2022,start_mel,191,greg,2022-05-19,,,empty,"Next to failed 83. 4/20: pink in nest, 4/27: paper removed, 5/26: orange paper in nest and orange paper 6' to east" +2022,start_mel,193,greg,2022-02-22,,,,"3/30: 2 eggs on ground, 4/20: pink in nest area, nest gone, 4/27: paper removed, nest gone, 5/26: pink paper 2 pieces - one piece 3' to N" +2022,start_mel,193,greg,2022-03-02,,,,"3/30: 2 eggs on ground, 4/20: pink in nest area, nest gone, 4/27: paper removed, nest gone, 5/26: pink paper 2 pieces - one piece 3' to N" +2022,start_mel,193,greg,2022-03-22,3,,incubating,"3/30: 2 eggs on ground, 4/20: pink in nest area, nest gone, 4/27: paper removed, nest gone, 5/26: pink paper 2 pieces - one piece 3' to N" +2022,start_mel,193,greg,2022-03-30,,,empty,"3/30: 2 eggs on ground, 4/20: pink in nest area, nest gone, 4/27: paper removed, nest gone, 5/26: pink paper 2 pieces - one piece 3' to N" +2022,start_mel,193,greg,2022-04-06,,,empty,"3/30: 2 eggs on ground, 4/20: pink in nest area, nest gone, 4/27: paper removed, nest gone, 5/26: pink paper 2 pieces - one piece 3' to N" +2022,start_mel,193,greg,2022-04-13,,,empty,"3/30: 2 eggs on ground, 4/20: pink in nest area, nest gone, 4/27: paper removed, nest gone, 5/26: pink paper 2 pieces - one piece 3' to N" +2022,start_mel,193,greg,2022-04-20,,,,"3/30: 2 eggs on ground, 4/20: pink in nest area, nest gone, 4/27: paper removed, nest gone, 5/26: pink paper 2 pieces - one piece 3' to N" +2022,start_mel,193,greg,2022-04-27,,,,"3/30: 2 eggs on ground, 4/20: pink in nest area, nest gone, 4/27: paper removed, nest gone, 5/26: pink paper 2 pieces - one piece 3' to N" +2022,start_mel,193,greg,2022-05-04,,,,"3/30: 2 eggs on ground, 4/20: pink in nest area, nest gone, 4/27: paper removed, nest gone, 5/26: pink paper 2 pieces - one piece 3' to N" +2022,start_mel,193,greg,2022-05-13,,,,"3/30: 2 eggs on ground, 4/20: pink in nest area, nest gone, 4/27: paper removed, nest gone, 5/26: pink paper 2 pieces - one piece 3' to N" +2022,start_mel,193,greg,2022-05-19,,,,"3/30: 2 eggs on ground, 4/20: pink in nest area, nest gone, 4/27: paper removed, nest gone, 5/26: pink paper 2 pieces - one piece 3' to N" +2022,start_mel,195,greg,2022-02-22,,,,"4/20: blue paper in nest, 4/27: paper removed, 5/26: orange paper" +2022,start_mel,195,greg,2022-03-02,,,,"4/20: blue paper in nest, 4/27: paper removed, 5/26: orange paper" +2022,start_mel,195,greg,2022-03-22,2,,incubating,"4/20: blue paper in nest, 4/27: paper removed, 5/26: orange paper" +2022,start_mel,195,greg,2022-03-30,2,,incubating,"4/20: blue paper in nest, 4/27: paper removed, 5/26: orange paper" +2022,start_mel,195,greg,2022-04-06,,,empty,"4/20: blue paper in nest, 4/27: paper removed, 5/26: orange paper" +2022,start_mel,195,greg,2022-04-13,,,empty,"4/20: blue paper in nest, 4/27: paper removed, 5/26: orange paper" +2022,start_mel,195,greg,2022-04-20,,,empty,"4/20: blue paper in nest, 4/27: paper removed, 5/26: orange paper" +2022,start_mel,195,greg,2022-04-27,,,empty,"4/20: blue paper in nest, 4/27: paper removed, 5/26: orange paper" +2022,start_mel,195,greg,2022-05-04,,,empty,"4/20: blue paper in nest, 4/27: paper removed, 5/26: orange paper" +2022,start_mel,195,greg,2022-05-13,,,empty,"4/20: blue paper in nest, 4/27: paper removed, 5/26: orange paper" +2022,start_mel,195,greg,2022-05-19,,,empty,"4/20: blue paper in nest, 4/27: paper removed, 5/26: orange paper" +2022,start_mel,379,greg,2022-02-22,,,,"4/20: pink paper on edge of nest, 5/13: healthy, both parents present, 5/26: pink paper" +2022,start_mel,379,greg,2022-03-02,,,,"4/20: pink paper on edge of nest, 5/13: healthy, both parents present, 5/26: pink paper" +2022,start_mel,379,greg,2022-03-22,,,,"4/20: pink paper on edge of nest, 5/13: healthy, both parents present, 5/26: pink paper" +2022,start_mel,379,greg,2022-03-30,2,,incubating,"4/20: pink paper on edge of nest, 5/13: healthy, both parents present, 5/26: pink paper" +2022,start_mel,379,greg,2022-04-06,2,,incubating,"4/20: pink paper on edge of nest, 5/13: healthy, both parents present, 5/26: pink paper" +2022,start_mel,379,greg,2022-04-13,2,,incubating,"4/20: pink paper on edge of nest, 5/13: healthy, both parents present, 5/26: pink paper" +2022,start_mel,379,greg,2022-04-20,,1,nestling,"4/20: pink paper on edge of nest, 5/13: healthy, both parents present, 5/26: pink paper" +2022,start_mel,379,greg,2022-04-27,,1,nestling,"4/20: pink paper on edge of nest, 5/13: healthy, both parents present, 5/26: pink paper" +2022,start_mel,379,greg,2022-05-04,,1,nestling,"4/20: pink paper on edge of nest, 5/13: healthy, both parents present, 5/26: pink paper" +2022,start_mel,379,greg,2022-05-13,,1,nestling,"4/20: pink paper on edge of nest, 5/13: healthy, both parents present, 5/26: pink paper" +2022,start_mel,379,greg,2022-05-19,,,empty,"4/20: pink paper on edge of nest, 5/13: healthy, both parents present, 5/26: pink paper" +2022,vacation,58,gbhe,2022-03-02,3,,incubating,"3/15: collapsed, pulled flag" +2022,vacation,58,gbhe,2022-03-08,3,,incubating,"3/15: collapsed, pulled flag" +2022,vacation,58,gbhe,2022-03-15,,,empty,"3/15: collapsed, pulled flag" +2022,vacation,58,gbhe,2022-03-22,,,,"3/15: collapsed, pulled flag" +2022,vacation,58,gbhe,2022-03-30,,,,"3/15: collapsed, pulled flag" +2022,vacation,58,gbhe,2022-04-06,,,,"3/15: collapsed, pulled flag" +2022,vacation,58,gbhe,2022-04-13,,,,"3/15: collapsed, pulled flag" +2022,vacation,58,gbhe,2022-04-20,,,,"3/15: collapsed, pulled flag" +2022,vacation,58,gbhe,2022-04-27,,,,"3/15: collapsed, pulled flag" +2022,vacation,58,gbhe,2022-05-04,,,,"3/15: collapsed, pulled flag" +2022,vacation,58,gbhe,2022-05-13,,,,"3/15: collapsed, pulled flag" +2022,vacation,58,gbhe,2022-05-19,,,,"3/15: collapsed, pulled flag" +2022,vacation,58,gbhe,2022-05-26,,,,"3/15: collapsed, pulled flag" +2022,vacation,58,gbhe,2022-06-01,,,,"3/15: collapsed, pulled flag" +2022,vacation,58,gbhe,2022-06-09,,,,"3/15: collapsed, pulled flag" +2022,vacation,56,greg,2022-03-02,3,,incubating,"3/15: 1 egg pipping, chick wet, 3/22: chick dry, 3/30: 1C dead on ground, 4/27: 2c branchlings on branch ~2m away, 5/4: 3 branchlings in tree, 5/19: blue flag in nest, 5/26: orange paper on canopy" +2022,vacation,56,greg,2022-03-08,3,,incubating,"3/15: 1 egg pipping, chick wet, 3/22: chick dry, 3/30: 1C dead on ground, 4/27: 2c branchlings on branch ~2m away, 5/4: 3 branchlings in tree, 5/19: blue flag in nest, 5/26: orange paper on canopy" +2022,vacation,56,greg,2022-03-15,2,1,wet_chick,"3/15: 1 egg pipping, chick wet, 3/22: chick dry, 3/30: 1C dead on ground, 4/27: 2c branchlings on branch ~2m away, 5/4: 3 branchlings in tree, 5/19: blue flag in nest, 5/26: orange paper on canopy" +2022,vacation,56,greg,2022-03-22,,3,nestling,"3/15: 1 egg pipping, chick wet, 3/22: chick dry, 3/30: 1C dead on ground, 4/27: 2c branchlings on branch ~2m away, 5/4: 3 branchlings in tree, 5/19: blue flag in nest, 5/26: orange paper on canopy" +2022,vacation,56,greg,2022-03-30,,2,nestling,"3/15: 1 egg pipping, chick wet, 3/22: chick dry, 3/30: 1C dead on ground, 4/27: 2c branchlings on branch ~2m away, 5/4: 3 branchlings in tree, 5/19: blue flag in nest, 5/26: orange paper on canopy" +2022,vacation,56,greg,2022-04-06,,2,nestling,"3/15: 1 egg pipping, chick wet, 3/22: chick dry, 3/30: 1C dead on ground, 4/27: 2c branchlings on branch ~2m away, 5/4: 3 branchlings in tree, 5/19: blue flag in nest, 5/26: orange paper on canopy" +2022,vacation,56,greg,2022-04-13,,1,nestling,"3/15: 1 egg pipping, chick wet, 3/22: chick dry, 3/30: 1C dead on ground, 4/27: 2c branchlings on branch ~2m away, 5/4: 3 branchlings in tree, 5/19: blue flag in nest, 5/26: orange paper on canopy" +2022,vacation,56,greg,2022-04-20,,2,nestling,"3/15: 1 egg pipping, chick wet, 3/22: chick dry, 3/30: 1C dead on ground, 4/27: 2c branchlings on branch ~2m away, 5/4: 3 branchlings in tree, 5/19: blue flag in nest, 5/26: orange paper on canopy" +2022,vacation,56,greg,2022-04-27,,2,branchling,"3/15: 1 egg pipping, chick wet, 3/22: chick dry, 3/30: 1C dead on ground, 4/27: 2c branchlings on branch ~2m away, 5/4: 3 branchlings in tree, 5/19: blue flag in nest, 5/26: orange paper on canopy" +2022,vacation,56,greg,2022-05-04,,,empty,"3/15: 1 egg pipping, chick wet, 3/22: chick dry, 3/30: 1C dead on ground, 4/27: 2c branchlings on branch ~2m away, 5/4: 3 branchlings in tree, 5/19: blue flag in nest, 5/26: orange paper on canopy" +2022,vacation,56,greg,2022-05-13,,,empty,"3/15: 1 egg pipping, chick wet, 3/22: chick dry, 3/30: 1C dead on ground, 4/27: 2c branchlings on branch ~2m away, 5/4: 3 branchlings in tree, 5/19: blue flag in nest, 5/26: orange paper on canopy" +2022,vacation,56,greg,2022-05-19,,,collapsed,"3/15: 1 egg pipping, chick wet, 3/22: chick dry, 3/30: 1C dead on ground, 4/27: 2c branchlings on branch ~2m away, 5/4: 3 branchlings in tree, 5/19: blue flag in nest, 5/26: orange paper on canopy" +2022,vacation,56,greg,2022-05-26,,,collapsed,"3/15: 1 egg pipping, chick wet, 3/22: chick dry, 3/30: 1C dead on ground, 4/27: 2c branchlings on branch ~2m away, 5/4: 3 branchlings in tree, 5/19: blue flag in nest, 5/26: orange paper on canopy" +2022,vacation,56,greg,2022-06-01,,,,"3/15: 1 egg pipping, chick wet, 3/22: chick dry, 3/30: 1C dead on ground, 4/27: 2c branchlings on branch ~2m away, 5/4: 3 branchlings in tree, 5/19: blue flag in nest, 5/26: orange paper on canopy" +2022,vacation,56,greg,2022-06-09,,,,"3/15: 1 egg pipping, chick wet, 3/22: chick dry, 3/30: 1C dead on ground, 4/27: 2c branchlings on branch ~2m away, 5/4: 3 branchlings in tree, 5/19: blue flag in nest, 5/26: orange paper on canopy" +2022,vacation,60,greg,2022-03-02,2,,incubating,"3/30: chicks dry, 4/6: two chicks big and one very small, 4/20: all 3C are branchlings, 4/27: 3c branchlings on branch ~2m away, mercury done, 5/13: green in nest #4 5/19: gone, 5/26: gone, 6/1: pulled" +2022,vacation,60,greg,2022-03-08,3,,incubating,"3/30: chicks dry, 4/6: two chicks big and one very small, 4/20: all 3C are branchlings, 4/27: 3c branchlings on branch ~2m away, mercury done, 5/13: green in nest #4 5/19: gone, 5/26: gone, 6/1: pulled" +2022,vacation,60,greg,2022-03-15,3,,incubating,"3/30: chicks dry, 4/6: two chicks big and one very small, 4/20: all 3C are branchlings, 4/27: 3c branchlings on branch ~2m away, mercury done, 5/13: green in nest #4 5/19: gone, 5/26: gone, 6/1: pulled" +2022,vacation,60,greg,2022-03-22,3,,incubating,"3/30: chicks dry, 4/6: two chicks big and one very small, 4/20: all 3C are branchlings, 4/27: 3c branchlings on branch ~2m away, mercury done, 5/13: green in nest #4 5/19: gone, 5/26: gone, 6/1: pulled" +2022,vacation,60,greg,2022-03-30,,3,chick_dry,"3/30: chicks dry, 4/6: two chicks big and one very small, 4/20: all 3C are branchlings, 4/27: 3c branchlings on branch ~2m away, mercury done, 5/13: green in nest #4 5/19: gone, 5/26: gone, 6/1: pulled" +2022,vacation,60,greg,2022-04-06,,3,nestling,"3/30: chicks dry, 4/6: two chicks big and one very small, 4/20: all 3C are branchlings, 4/27: 3c branchlings on branch ~2m away, mercury done, 5/13: green in nest #4 5/19: gone, 5/26: gone, 6/1: pulled" +2022,vacation,60,greg,2022-04-13,,3,nestling,"3/30: chicks dry, 4/6: two chicks big and one very small, 4/20: all 3C are branchlings, 4/27: 3c branchlings on branch ~2m away, mercury done, 5/13: green in nest #4 5/19: gone, 5/26: gone, 6/1: pulled" +2022,vacation,60,greg,2022-04-20,,3,branchling,"3/30: chicks dry, 4/6: two chicks big and one very small, 4/20: all 3C are branchlings, 4/27: 3c branchlings on branch ~2m away, mercury done, 5/13: green in nest #4 5/19: gone, 5/26: gone, 6/1: pulled" +2022,vacation,60,greg,2022-04-27,,3,branchling,"3/30: chicks dry, 4/6: two chicks big and one very small, 4/20: all 3C are branchlings, 4/27: 3c branchlings on branch ~2m away, mercury done, 5/13: green in nest #4 5/19: gone, 5/26: gone, 6/1: pulled" +2022,vacation,60,greg,2022-05-04,,,empty,"3/30: chicks dry, 4/6: two chicks big and one very small, 4/20: all 3C are branchlings, 4/27: 3c branchlings on branch ~2m away, mercury done, 5/13: green in nest #4 5/19: gone, 5/26: gone, 6/1: pulled" +2022,vacation,60,greg,2022-05-13,,,empty,"3/30: chicks dry, 4/6: two chicks big and one very small, 4/20: all 3C are branchlings, 4/27: 3c branchlings on branch ~2m away, mercury done, 5/13: green in nest #4 5/19: gone, 5/26: gone, 6/1: pulled" +2022,vacation,60,greg,2022-05-19,,,empty,"3/30: chicks dry, 4/6: two chicks big and one very small, 4/20: all 3C are branchlings, 4/27: 3c branchlings on branch ~2m away, mercury done, 5/13: green in nest #4 5/19: gone, 5/26: gone, 6/1: pulled" +2022,vacation,60,greg,2022-05-26,,,collapsed,"3/30: chicks dry, 4/6: two chicks big and one very small, 4/20: all 3C are branchlings, 4/27: 3c branchlings on branch ~2m away, mercury done, 5/13: green in nest #4 5/19: gone, 5/26: gone, 6/1: pulled" +2022,vacation,60,greg,2022-06-01,,,,"3/30: chicks dry, 4/6: two chicks big and one very small, 4/20: all 3C are branchlings, 4/27: 3c branchlings on branch ~2m away, mercury done, 5/13: green in nest #4 5/19: gone, 5/26: gone, 6/1: pulled" +2022,vacation,60,greg,2022-06-09,,,,"3/30: chicks dry, 4/6: two chicks big and one very small, 4/20: all 3C are branchlings, 4/27: 3c branchlings on branch ~2m away, mercury done, 5/13: green in nest #4 5/19: gone, 5/26: gone, 6/1: pulled" +2022,vacation,64,greg,2022-03-02,3,,incubating,"4/6: mercury, 4/20: pink paper in nest, 4/27: paper removed, 5/26: pink paper, gone, 6/1: pulled" +2022,vacation,64,greg,2022-03-08,3,,incubating,"4/6: mercury, 4/20: pink paper in nest, 4/27: paper removed, 5/26: pink paper, gone, 6/1: pulled" +2022,vacation,64,greg,2022-03-15,,3,nestling,"4/6: mercury, 4/20: pink paper in nest, 4/27: paper removed, 5/26: pink paper, gone, 6/1: pulled" +2022,vacation,64,greg,2022-03-22,,3,nestling,"4/6: mercury, 4/20: pink paper in nest, 4/27: paper removed, 5/26: pink paper, gone, 6/1: pulled" +2022,vacation,64,greg,2022-03-30,,2,nestling,"4/6: mercury, 4/20: pink paper in nest, 4/27: paper removed, 5/26: pink paper, gone, 6/1: pulled" +2022,vacation,64,greg,2022-04-06,,2,nestling,"4/6: mercury, 4/20: pink paper in nest, 4/27: paper removed, 5/26: pink paper, gone, 6/1: pulled" +2022,vacation,64,greg,2022-04-13,,2,nestling,"4/6: mercury, 4/20: pink paper in nest, 4/27: paper removed, 5/26: pink paper, gone, 6/1: pulled" +2022,vacation,64,greg,2022-04-20,,,empty,"4/6: mercury, 4/20: pink paper in nest, 4/27: paper removed, 5/26: pink paper, gone, 6/1: pulled" +2022,vacation,64,greg,2022-04-27,,,empty,"4/6: mercury, 4/20: pink paper in nest, 4/27: paper removed, 5/26: pink paper, gone, 6/1: pulled" +2022,vacation,64,greg,2022-05-04,,,collapsed,"4/6: mercury, 4/20: pink paper in nest, 4/27: paper removed, 5/26: pink paper, gone, 6/1: pulled" +2022,vacation,64,greg,2022-05-13,,,,"4/6: mercury, 4/20: pink paper in nest, 4/27: paper removed, 5/26: pink paper, gone, 6/1: pulled" +2022,vacation,64,greg,2022-05-19,,,,"4/6: mercury, 4/20: pink paper in nest, 4/27: paper removed, 5/26: pink paper, gone, 6/1: pulled" +2022,vacation,64,greg,2022-05-26,,,collapsed,"4/6: mercury, 4/20: pink paper in nest, 4/27: paper removed, 5/26: pink paper, gone, 6/1: pulled" +2022,vacation,64,greg,2022-06-01,,,,"4/6: mercury, 4/20: pink paper in nest, 4/27: paper removed, 5/26: pink paper, gone, 6/1: pulled" +2022,vacation,64,greg,2022-06-09,,,,"4/6: mercury, 4/20: pink paper in nest, 4/27: paper removed, 5/26: pink paper, gone, 6/1: pulled" +2022,vacation,66,greg,2022-03-02,3,,incubating,"3/8: look for 129, 4/27: chicks big, 5/26: near 129 pond apple, 6/1: pulled, 1c+" +2022,vacation,66,greg,2022-03-08,3,,incubating,"3/8: look for 129, 4/27: chicks big, 5/26: near 129 pond apple, 6/1: pulled, 1c+" +2022,vacation,66,greg,2022-03-15,,,empty,"3/8: look for 129, 4/27: chicks big, 5/26: near 129 pond apple, 6/1: pulled, 1c+" +2022,vacation,66,greg,2022-03-22,,,empty,"3/8: look for 129, 4/27: chicks big, 5/26: near 129 pond apple, 6/1: pulled, 1c+" +2022,vacation,66,greg,2022-03-30,2,,incubating,"3/8: look for 129, 4/27: chicks big, 5/26: near 129 pond apple, 6/1: pulled, 1c+" +2022,vacation,66,greg,2022-04-06,2,,incubating,"3/8: look for 129, 4/27: chicks big, 5/26: near 129 pond apple, 6/1: pulled, 1c+" +2022,vacation,66,greg,2022-04-13,2,,incubating,"3/8: look for 129, 4/27: chicks big, 5/26: near 129 pond apple, 6/1: pulled, 1c+" +2022,vacation,66,greg,2022-04-20,2,,incubating,"3/8: look for 129, 4/27: chicks big, 5/26: near 129 pond apple, 6/1: pulled, 1c+" +2022,vacation,66,greg,2022-04-27,,2,nestling,"3/8: look for 129, 4/27: chicks big, 5/26: near 129 pond apple, 6/1: pulled, 1c+" +2022,vacation,66,greg,2022-05-04,,2,nestling,"3/8: look for 129, 4/27: chicks big, 5/26: near 129 pond apple, 6/1: pulled, 1c+" +2022,vacation,66,greg,2022-05-13,,2,nestling,"3/8: look for 129, 4/27: chicks big, 5/26: near 129 pond apple, 6/1: pulled, 1c+" +2022,vacation,66,greg,2022-05-19,,2,nestling,"3/8: look for 129, 4/27: chicks big, 5/26: near 129 pond apple, 6/1: pulled, 1c+" +2022,vacation,66,greg,2022-05-26,,2,nestling,"3/8: look for 129, 4/27: chicks big, 5/26: near 129 pond apple, 6/1: pulled, 1c+" +2022,vacation,66,greg,2022-06-01,,1,branchling,"3/8: look for 129, 4/27: chicks big, 5/26: near 129 pond apple, 6/1: pulled, 1c+" +2022,vacation,66,greg,2022-06-09,,,,"3/8: look for 129, 4/27: chicks big, 5/26: near 129 pond apple, 6/1: pulled, 1c+" +2022,vacation,62,greg,2022-03-02,2,,incubating,"4/6: one egg pipping, 4/13: youngest dry, 4/20: blue paper next to nest, 4/27: do mercury next week, paper removed, 5/13: 2+C in tree" +2022,vacation,62,greg,2022-03-08,,,empty,"4/6: one egg pipping, 4/13: youngest dry, 4/20: blue paper next to nest, 4/27: do mercury next week, paper removed, 5/13: 2+C in tree" +2022,vacation,62,greg,2022-03-15,3,,incubating,"4/6: one egg pipping, 4/13: youngest dry, 4/20: blue paper next to nest, 4/27: do mercury next week, paper removed, 5/13: 2+C in tree" +2022,vacation,62,greg,2022-03-22,3,,incubating,"4/6: one egg pipping, 4/13: youngest dry, 4/20: blue paper next to nest, 4/27: do mercury next week, paper removed, 5/13: 2+C in tree" +2022,vacation,62,greg,2022-03-30,3,,incubating,"4/6: one egg pipping, 4/13: youngest dry, 4/20: blue paper next to nest, 4/27: do mercury next week, paper removed, 5/13: 2+C in tree" +2022,vacation,62,greg,2022-04-06,3,,incubating,"4/6: one egg pipping, 4/13: youngest dry, 4/20: blue paper next to nest, 4/27: do mercury next week, paper removed, 5/13: 2+C in tree" +2022,vacation,62,greg,2022-04-13,,3,nestling,"4/6: one egg pipping, 4/13: youngest dry, 4/20: blue paper next to nest, 4/27: do mercury next week, paper removed, 5/13: 2+C in tree" +2022,vacation,62,greg,2022-04-20,,3,nestling,"4/6: one egg pipping, 4/13: youngest dry, 4/20: blue paper next to nest, 4/27: do mercury next week, paper removed, 5/13: 2+C in tree" +2022,vacation,62,greg,2022-04-27,,3,nestling,"4/6: one egg pipping, 4/13: youngest dry, 4/20: blue paper next to nest, 4/27: do mercury next week, paper removed, 5/13: 2+C in tree" +2022,vacation,62,greg,2022-05-04,,1,nestling,"4/6: one egg pipping, 4/13: youngest dry, 4/20: blue paper next to nest, 4/27: do mercury next week, paper removed, 5/13: 2+C in tree" +2022,vacation,62,greg,2022-05-13,,2,branchling,"4/6: one egg pipping, 4/13: youngest dry, 4/20: blue paper next to nest, 4/27: do mercury next week, paper removed, 5/13: 2+C in tree" +2022,vacation,62,greg,2022-05-19,,,empty,"4/6: one egg pipping, 4/13: youngest dry, 4/20: blue paper next to nest, 4/27: do mercury next week, paper removed, 5/13: 2+C in tree" +2022,vacation,62,greg,2022-05-26,,,empty,"4/6: one egg pipping, 4/13: youngest dry, 4/20: blue paper next to nest, 4/27: do mercury next week, paper removed, 5/13: 2+C in tree" +2022,vacation,62,greg,2022-06-01,,,,"4/6: one egg pipping, 4/13: youngest dry, 4/20: blue paper next to nest, 4/27: do mercury next week, paper removed, 5/13: 2+C in tree" +2022,vacation,62,greg,2022-06-09,,,,"4/6: one egg pipping, 4/13: youngest dry, 4/20: blue paper next to nest, 4/27: do mercury next week, paper removed, 5/13: 2+C in tree" +2022,vacation,68,greg,2022-03-02,3,,incubating,"3/22: chick dry, 4/20: pink paper in nest, 4/27: collapsed, paper removed, 5/19: gone, 5/26: gone, blue paper in pond apple - may fall, 6/1: pulled" +2022,vacation,68,greg,2022-03-08,3,,incubating,"3/22: chick dry, 4/20: pink paper in nest, 4/27: collapsed, paper removed, 5/19: gone, 5/26: gone, blue paper in pond apple - may fall, 6/1: pulled" +2022,vacation,68,greg,2022-03-15,3,,incubating,"3/22: chick dry, 4/20: pink paper in nest, 4/27: collapsed, paper removed, 5/19: gone, 5/26: gone, blue paper in pond apple - may fall, 6/1: pulled" +2022,vacation,68,greg,2022-03-22,,3,chick_dry,"3/22: chick dry, 4/20: pink paper in nest, 4/27: collapsed, paper removed, 5/19: gone, 5/26: gone, blue paper in pond apple - may fall, 6/1: pulled" +2022,vacation,68,greg,2022-03-30,,2,nestling,"3/22: chick dry, 4/20: pink paper in nest, 4/27: collapsed, paper removed, 5/19: gone, 5/26: gone, blue paper in pond apple - may fall, 6/1: pulled" +2022,vacation,68,greg,2022-04-06,,2,nestling,"3/22: chick dry, 4/20: pink paper in nest, 4/27: collapsed, paper removed, 5/19: gone, 5/26: gone, blue paper in pond apple - may fall, 6/1: pulled" +2022,vacation,68,greg,2022-04-13,,2,nestling,"3/22: chick dry, 4/20: pink paper in nest, 4/27: collapsed, paper removed, 5/19: gone, 5/26: gone, blue paper in pond apple - may fall, 6/1: pulled" +2022,vacation,68,greg,2022-04-20,,,empty,"3/22: chick dry, 4/20: pink paper in nest, 4/27: collapsed, paper removed, 5/19: gone, 5/26: gone, blue paper in pond apple - may fall, 6/1: pulled" +2022,vacation,68,greg,2022-04-27,,,collapsed,"3/22: chick dry, 4/20: pink paper in nest, 4/27: collapsed, paper removed, 5/19: gone, 5/26: gone, blue paper in pond apple - may fall, 6/1: pulled" +2022,vacation,68,greg,2022-05-04,,,collapsed,"3/22: chick dry, 4/20: pink paper in nest, 4/27: collapsed, paper removed, 5/19: gone, 5/26: gone, blue paper in pond apple - may fall, 6/1: pulled" +2022,vacation,68,greg,2022-05-13,,,,"3/22: chick dry, 4/20: pink paper in nest, 4/27: collapsed, paper removed, 5/19: gone, 5/26: gone, blue paper in pond apple - may fall, 6/1: pulled" +2022,vacation,68,greg,2022-05-19,,,,"3/22: chick dry, 4/20: pink paper in nest, 4/27: collapsed, paper removed, 5/19: gone, 5/26: gone, blue paper in pond apple - may fall, 6/1: pulled" +2022,vacation,68,greg,2022-05-26,,,collapsed,"3/22: chick dry, 4/20: pink paper in nest, 4/27: collapsed, paper removed, 5/19: gone, 5/26: gone, blue paper in pond apple - may fall, 6/1: pulled" +2022,vacation,68,greg,2022-06-01,,,,"3/22: chick dry, 4/20: pink paper in nest, 4/27: collapsed, paper removed, 5/19: gone, 5/26: gone, blue paper in pond apple - may fall, 6/1: pulled" +2022,vacation,68,greg,2022-06-09,,,,"3/22: chick dry, 4/20: pink paper in nest, 4/27: collapsed, paper removed, 5/19: gone, 5/26: gone, blue paper in pond apple - may fall, 6/1: pulled" +2022,vacation,70,greg,2022-03-02,1,,incubating,"Tree collapsed on top. 4/6: shells in nest, 4/13: drone--pink flagging, 4/20: pink paper in nest, 4/27: paper removed, 5/19: blue flag in nest" +2022,vacation,70,greg,2022-03-08,3,,incubating,"Tree collapsed on top. 4/6: shells in nest, 4/13: drone--pink flagging, 4/20: pink paper in nest, 4/27: paper removed, 5/19: blue flag in nest" +2022,vacation,70,greg,2022-03-15,,,empty,"Tree collapsed on top. 4/6: shells in nest, 4/13: drone--pink flagging, 4/20: pink paper in nest, 4/27: paper removed, 5/19: blue flag in nest" +2022,vacation,70,greg,2022-03-22,,,empty,"Tree collapsed on top. 4/6: shells in nest, 4/13: drone--pink flagging, 4/20: pink paper in nest, 4/27: paper removed, 5/19: blue flag in nest" +2022,vacation,70,greg,2022-03-30,,,empty,"Tree collapsed on top. 4/6: shells in nest, 4/13: drone--pink flagging, 4/20: pink paper in nest, 4/27: paper removed, 5/19: blue flag in nest" +2022,vacation,70,greg,2022-04-06,,,empty,"Tree collapsed on top. 4/6: shells in nest, 4/13: drone--pink flagging, 4/20: pink paper in nest, 4/27: paper removed, 5/19: blue flag in nest" +2022,vacation,70,greg,2022-04-13,,,empty,"Tree collapsed on top. 4/6: shells in nest, 4/13: drone--pink flagging, 4/20: pink paper in nest, 4/27: paper removed, 5/19: blue flag in nest" +2022,vacation,70,greg,2022-04-20,,,empty,"Tree collapsed on top. 4/6: shells in nest, 4/13: drone--pink flagging, 4/20: pink paper in nest, 4/27: paper removed, 5/19: blue flag in nest" +2022,vacation,70,greg,2022-04-27,,,empty,"Tree collapsed on top. 4/6: shells in nest, 4/13: drone--pink flagging, 4/20: pink paper in nest, 4/27: paper removed, 5/19: blue flag in nest" +2022,vacation,70,greg,2022-05-04,,,empty,"Tree collapsed on top. 4/6: shells in nest, 4/13: drone--pink flagging, 4/20: pink paper in nest, 4/27: paper removed, 5/19: blue flag in nest" +2022,vacation,70,greg,2022-05-13,,,empty,"Tree collapsed on top. 4/6: shells in nest, 4/13: drone--pink flagging, 4/20: pink paper in nest, 4/27: paper removed, 5/19: blue flag in nest" +2022,vacation,70,greg,2022-05-19,,,empty,"Tree collapsed on top. 4/6: shells in nest, 4/13: drone--pink flagging, 4/20: pink paper in nest, 4/27: paper removed, 5/19: blue flag in nest" +2022,vacation,70,greg,2022-05-26,,,empty,"Tree collapsed on top. 4/6: shells in nest, 4/13: drone--pink flagging, 4/20: pink paper in nest, 4/27: paper removed, 5/19: blue flag in nest" +2022,vacation,70,greg,2022-06-01,,,,"Tree collapsed on top. 4/6: shells in nest, 4/13: drone--pink flagging, 4/20: pink paper in nest, 4/27: paper removed, 5/19: blue flag in nest" +2022,vacation,70,greg,2022-06-09,,,,"Tree collapsed on top. 4/6: shells in nest, 4/13: drone--pink flagging, 4/20: pink paper in nest, 4/27: paper removed, 5/19: blue flag in nest" +2022,vacation,74,greg,2022-03-02,2,,incubating,"3/30: chick dry, 4/20: all 3C are branchlings, 4/27: branchling size but in the nest, 5/13: yellow paper in nest #6, 5/19: blue flag in nest" +2022,vacation,74,greg,2022-03-08,2,,incubating,"3/30: chick dry, 4/20: all 3C are branchlings, 4/27: branchling size but in the nest, 5/13: yellow paper in nest #6, 5/19: blue flag in nest" +2022,vacation,74,greg,2022-03-15,2,,incubating,"3/30: chick dry, 4/20: all 3C are branchlings, 4/27: branchling size but in the nest, 5/13: yellow paper in nest #6, 5/19: blue flag in nest" +2022,vacation,74,greg,2022-03-22,2,,incubating,"3/30: chick dry, 4/20: all 3C are branchlings, 4/27: branchling size but in the nest, 5/13: yellow paper in nest #6, 5/19: blue flag in nest" +2022,vacation,74,greg,2022-03-30,,2,chick_dry,"3/30: chick dry, 4/20: all 3C are branchlings, 4/27: branchling size but in the nest, 5/13: yellow paper in nest #6, 5/19: blue flag in nest" +2022,vacation,74,greg,2022-04-06,,2,nestling,"3/30: chick dry, 4/20: all 3C are branchlings, 4/27: branchling size but in the nest, 5/13: yellow paper in nest #6, 5/19: blue flag in nest" +2022,vacation,74,greg,2022-04-13,,2,nestling,"3/30: chick dry, 4/20: all 3C are branchlings, 4/27: branchling size but in the nest, 5/13: yellow paper in nest #6, 5/19: blue flag in nest" +2022,vacation,74,greg,2022-04-20,,3,branchling,"3/30: chick dry, 4/20: all 3C are branchlings, 4/27: branchling size but in the nest, 5/13: yellow paper in nest #6, 5/19: blue flag in nest" +2022,vacation,74,greg,2022-04-27,,2,nestling,"3/30: chick dry, 4/20: all 3C are branchlings, 4/27: branchling size but in the nest, 5/13: yellow paper in nest #6, 5/19: blue flag in nest" +2022,vacation,74,greg,2022-05-04,,,empty,"3/30: chick dry, 4/20: all 3C are branchlings, 4/27: branchling size but in the nest, 5/13: yellow paper in nest #6, 5/19: blue flag in nest" +2022,vacation,74,greg,2022-05-13,,,empty,"3/30: chick dry, 4/20: all 3C are branchlings, 4/27: branchling size but in the nest, 5/13: yellow paper in nest #6, 5/19: blue flag in nest" +2022,vacation,74,greg,2022-05-19,,,empty,"3/30: chick dry, 4/20: all 3C are branchlings, 4/27: branchling size but in the nest, 5/13: yellow paper in nest #6, 5/19: blue flag in nest" +2022,vacation,74,greg,2022-05-26,,,empty,"3/30: chick dry, 4/20: all 3C are branchlings, 4/27: branchling size but in the nest, 5/13: yellow paper in nest #6, 5/19: blue flag in nest" +2022,vacation,74,greg,2022-06-01,,,,"3/30: chick dry, 4/20: all 3C are branchlings, 4/27: branchling size but in the nest, 5/13: yellow paper in nest #6, 5/19: blue flag in nest" +2022,vacation,74,greg,2022-06-09,,,,"3/30: chick dry, 4/20: all 3C are branchlings, 4/27: branchling size but in the nest, 5/13: yellow paper in nest #6, 5/19: blue flag in nest" +2022,vacation,72,greg,2022-03-02,3,,incubating,"4/27: nest 567 immediately next to it, 5/26: right by 567, gone, 6/1: pulled" +2022,vacation,72,greg,2022-03-08,3,,incubating,"4/27: nest 567 immediately next to it, 5/26: right by 567, gone, 6/1: pulled" +2022,vacation,72,greg,2022-03-15,3,,incubating,"4/27: nest 567 immediately next to it, 5/26: right by 567, gone, 6/1: pulled" +2022,vacation,72,greg,2022-03-22,,,empty,"4/27: nest 567 immediately next to it, 5/26: right by 567, gone, 6/1: pulled" +2022,vacation,72,greg,2022-03-30,,,empty,"4/27: nest 567 immediately next to it, 5/26: right by 567, gone, 6/1: pulled" +2022,vacation,72,greg,2022-04-06,,,empty,"4/27: nest 567 immediately next to it, 5/26: right by 567, gone, 6/1: pulled" +2022,vacation,72,greg,2022-04-13,,,empty,"4/27: nest 567 immediately next to it, 5/26: right by 567, gone, 6/1: pulled" +2022,vacation,72,greg,2022-04-20,,,empty,"4/27: nest 567 immediately next to it, 5/26: right by 567, gone, 6/1: pulled" +2022,vacation,72,greg,2022-04-27,,,empty,"4/27: nest 567 immediately next to it, 5/26: right by 567, gone, 6/1: pulled" +2022,vacation,72,greg,2022-05-04,,,collapsed,"4/27: nest 567 immediately next to it, 5/26: right by 567, gone, 6/1: pulled" +2022,vacation,72,greg,2022-05-13,,,empty,"4/27: nest 567 immediately next to it, 5/26: right by 567, gone, 6/1: pulled" +2022,vacation,72,greg,2022-05-19,,,empty,"4/27: nest 567 immediately next to it, 5/26: right by 567, gone, 6/1: pulled" +2022,vacation,72,greg,2022-05-26,,,collapsed,"4/27: nest 567 immediately next to it, 5/26: right by 567, gone, 6/1: pulled" +2022,vacation,72,greg,2022-06-01,,,,"4/27: nest 567 immediately next to it, 5/26: right by 567, gone, 6/1: pulled" +2022,vacation,72,greg,2022-06-09,,,,"4/27: nest 567 immediately next to it, 5/26: right by 567, gone, 6/1: pulled" +2022,vacation,76,greg,2022-03-02,3,,incubating,"3/30: 1C dead hanging from nest, 4/6: do mercury next week, 4/13: mercury sampled, 4/20: pink paper in nest, 4/27: paper removed, 5/19: gone, 5/26: gone, 6/1: pulled" +2022,vacation,76,greg,2022-03-08,3,,incubating,"3/30: 1C dead hanging from nest, 4/6: do mercury next week, 4/13: mercury sampled, 4/20: pink paper in nest, 4/27: paper removed, 5/19: gone, 5/26: gone, 6/1: pulled" +2022,vacation,76,greg,2022-03-15,,3,nestling,"3/30: 1C dead hanging from nest, 4/6: do mercury next week, 4/13: mercury sampled, 4/20: pink paper in nest, 4/27: paper removed, 5/19: gone, 5/26: gone, 6/1: pulled" +2022,vacation,76,greg,2022-03-22,,3,nestling,"3/30: 1C dead hanging from nest, 4/6: do mercury next week, 4/13: mercury sampled, 4/20: pink paper in nest, 4/27: paper removed, 5/19: gone, 5/26: gone, 6/1: pulled" +2022,vacation,76,greg,2022-03-30,,2,nestling,"3/30: 1C dead hanging from nest, 4/6: do mercury next week, 4/13: mercury sampled, 4/20: pink paper in nest, 4/27: paper removed, 5/19: gone, 5/26: gone, 6/1: pulled" +2022,vacation,76,greg,2022-04-06,,2,nestling,"3/30: 1C dead hanging from nest, 4/6: do mercury next week, 4/13: mercury sampled, 4/20: pink paper in nest, 4/27: paper removed, 5/19: gone, 5/26: gone, 6/1: pulled" +2022,vacation,76,greg,2022-04-13,,2,nestling,"3/30: 1C dead hanging from nest, 4/6: do mercury next week, 4/13: mercury sampled, 4/20: pink paper in nest, 4/27: paper removed, 5/19: gone, 5/26: gone, 6/1: pulled" +2022,vacation,76,greg,2022-04-20,,,empty,"3/30: 1C dead hanging from nest, 4/6: do mercury next week, 4/13: mercury sampled, 4/20: pink paper in nest, 4/27: paper removed, 5/19: gone, 5/26: gone, 6/1: pulled" +2022,vacation,76,greg,2022-04-27,,,empty,"3/30: 1C dead hanging from nest, 4/6: do mercury next week, 4/13: mercury sampled, 4/20: pink paper in nest, 4/27: paper removed, 5/19: gone, 5/26: gone, 6/1: pulled" +2022,vacation,76,greg,2022-05-04,,,collapsed,"3/30: 1C dead hanging from nest, 4/6: do mercury next week, 4/13: mercury sampled, 4/20: pink paper in nest, 4/27: paper removed, 5/19: gone, 5/26: gone, 6/1: pulled" +2022,vacation,76,greg,2022-05-13,,,,"3/30: 1C dead hanging from nest, 4/6: do mercury next week, 4/13: mercury sampled, 4/20: pink paper in nest, 4/27: paper removed, 5/19: gone, 5/26: gone, 6/1: pulled" +2022,vacation,76,greg,2022-05-19,,,,"3/30: 1C dead hanging from nest, 4/6: do mercury next week, 4/13: mercury sampled, 4/20: pink paper in nest, 4/27: paper removed, 5/19: gone, 5/26: gone, 6/1: pulled" +2022,vacation,76,greg,2022-05-26,,,collapsed,"3/30: 1C dead hanging from nest, 4/6: do mercury next week, 4/13: mercury sampled, 4/20: pink paper in nest, 4/27: paper removed, 5/19: gone, 5/26: gone, 6/1: pulled" +2022,vacation,76,greg,2022-06-01,,,,"3/30: 1C dead hanging from nest, 4/6: do mercury next week, 4/13: mercury sampled, 4/20: pink paper in nest, 4/27: paper removed, 5/19: gone, 5/26: gone, 6/1: pulled" +2022,vacation,76,greg,2022-06-09,,,,"3/30: 1C dead hanging from nest, 4/6: do mercury next week, 4/13: mercury sampled, 4/20: pink paper in nest, 4/27: paper removed, 5/19: gone, 5/26: gone, 6/1: pulled" +2022,vacation,78,greg,2022-03-02,1,,incubating,"3/8: looks like ANHI nest, 4/20: orange paper in nest, nest collapsed, 4/27: paper removed, 5/26: yellow paper" +2022,vacation,78,greg,2022-03-08,3,,incubating,"3/8: looks like ANHI nest, 4/20: orange paper in nest, nest collapsed, 4/27: paper removed, 5/26: yellow paper" +2022,vacation,78,greg,2022-03-15,3,,incubating,"3/8: looks like ANHI nest, 4/20: orange paper in nest, nest collapsed, 4/27: paper removed, 5/26: yellow paper" +2022,vacation,78,greg,2022-03-22,,,empty,"3/8: looks like ANHI nest, 4/20: orange paper in nest, nest collapsed, 4/27: paper removed, 5/26: yellow paper" +2022,vacation,78,greg,2022-03-30,,,empty,"3/8: looks like ANHI nest, 4/20: orange paper in nest, nest collapsed, 4/27: paper removed, 5/26: yellow paper" +2022,vacation,78,greg,2022-04-06,,,empty,"3/8: looks like ANHI nest, 4/20: orange paper in nest, nest collapsed, 4/27: paper removed, 5/26: yellow paper" +2022,vacation,78,greg,2022-04-13,,,empty,"3/8: looks like ANHI nest, 4/20: orange paper in nest, nest collapsed, 4/27: paper removed, 5/26: yellow paper" +2022,vacation,78,greg,2022-04-20,,,collapsed,"3/8: looks like ANHI nest, 4/20: orange paper in nest, nest collapsed, 4/27: paper removed, 5/26: yellow paper" +2022,vacation,78,greg,2022-04-27,,,collapsed,"3/8: looks like ANHI nest, 4/20: orange paper in nest, nest collapsed, 4/27: paper removed, 5/26: yellow paper" +2022,vacation,78,greg,2022-05-04,,,collapsed,"3/8: looks like ANHI nest, 4/20: orange paper in nest, nest collapsed, 4/27: paper removed, 5/26: yellow paper" +2022,vacation,78,greg,2022-05-13,,,,"3/8: looks like ANHI nest, 4/20: orange paper in nest, nest collapsed, 4/27: paper removed, 5/26: yellow paper" +2022,vacation,78,greg,2022-05-19,,,,"3/8: looks like ANHI nest, 4/20: orange paper in nest, nest collapsed, 4/27: paper removed, 5/26: yellow paper" +2022,vacation,78,greg,2022-05-26,,,collapsed,"3/8: looks like ANHI nest, 4/20: orange paper in nest, nest collapsed, 4/27: paper removed, 5/26: yellow paper" +2022,vacation,78,greg,2022-06-01,,,,"3/8: looks like ANHI nest, 4/20: orange paper in nest, nest collapsed, 4/27: paper removed, 5/26: yellow paper" +2022,vacation,78,greg,2022-06-09,,,,"3/8: looks like ANHI nest, 4/20: orange paper in nest, nest collapsed, 4/27: paper removed, 5/26: yellow paper" +2022,vacation,80,greg,2022-03-02,2,,incubating,"3/30: youngest probably hatched yesterday, 4/27: nest next to it has 2C big (but no flagging? Could it be 141 or 197?), 5/4: 3 branchlings on next tree, 5/13: 3+ Flew flew!" +2022,vacation,80,greg,2022-03-08,3,,incubating,"3/30: youngest probably hatched yesterday, 4/27: nest next to it has 2C big (but no flagging? Could it be 141 or 197?), 5/4: 3 branchlings on next tree, 5/13: 3+ Flew flew!" +2022,vacation,80,greg,2022-03-15,3,,incubating,"3/30: youngest probably hatched yesterday, 4/27: nest next to it has 2C big (but no flagging? Could it be 141 or 197?), 5/4: 3 branchlings on next tree, 5/13: 3+ Flew flew!" +2022,vacation,80,greg,2022-03-22,3,,incubating,"3/30: youngest probably hatched yesterday, 4/27: nest next to it has 2C big (but no flagging? Could it be 141 or 197?), 5/4: 3 branchlings on next tree, 5/13: 3+ Flew flew!" +2022,vacation,80,greg,2022-03-30,1,2,hatching,"3/30: youngest probably hatched yesterday, 4/27: nest next to it has 2C big (but no flagging? Could it be 141 or 197?), 5/4: 3 branchlings on next tree, 5/13: 3+ Flew flew!" +2022,vacation,80,greg,2022-04-06,,3,nestling,"3/30: youngest probably hatched yesterday, 4/27: nest next to it has 2C big (but no flagging? Could it be 141 or 197?), 5/4: 3 branchlings on next tree, 5/13: 3+ Flew flew!" +2022,vacation,80,greg,2022-04-13,,3,nestling,"3/30: youngest probably hatched yesterday, 4/27: nest next to it has 2C big (but no flagging? Could it be 141 or 197?), 5/4: 3 branchlings on next tree, 5/13: 3+ Flew flew!" +2022,vacation,80,greg,2022-04-20,,3,nestling,"3/30: youngest probably hatched yesterday, 4/27: nest next to it has 2C big (but no flagging? Could it be 141 or 197?), 5/4: 3 branchlings on next tree, 5/13: 3+ Flew flew!" +2022,vacation,80,greg,2022-04-27,,2,nestling,"3/30: youngest probably hatched yesterday, 4/27: nest next to it has 2C big (but no flagging? Could it be 141 or 197?), 5/4: 3 branchlings on next tree, 5/13: 3+ Flew flew!" +2022,vacation,80,greg,2022-05-04,,,empty,"3/30: youngest probably hatched yesterday, 4/27: nest next to it has 2C big (but no flagging? Could it be 141 or 197?), 5/4: 3 branchlings on next tree, 5/13: 3+ Flew flew!" +2022,vacation,80,greg,2022-05-13,,3,,"3/30: youngest probably hatched yesterday, 4/27: nest next to it has 2C big (but no flagging? Could it be 141 or 197?), 5/4: 3 branchlings on next tree, 5/13: 3+ Flew flew!" +2022,vacation,80,greg,2022-05-19,,,empty,"3/30: youngest probably hatched yesterday, 4/27: nest next to it has 2C big (but no flagging? Could it be 141 or 197?), 5/4: 3 branchlings on next tree, 5/13: 3+ Flew flew!" +2022,vacation,80,greg,2022-05-26,,,empty,"3/30: youngest probably hatched yesterday, 4/27: nest next to it has 2C big (but no flagging? Could it be 141 or 197?), 5/4: 3 branchlings on next tree, 5/13: 3+ Flew flew!" +2022,vacation,80,greg,2022-06-01,,,,"3/30: youngest probably hatched yesterday, 4/27: nest next to it has 2C big (but no flagging? Could it be 141 or 197?), 5/4: 3 branchlings on next tree, 5/13: 3+ Flew flew!" +2022,vacation,80,greg,2022-06-09,,,,"3/30: youngest probably hatched yesterday, 4/27: nest next to it has 2C big (but no flagging? Could it be 141 or 197?), 5/4: 3 branchlings on next tree, 5/13: 3+ Flew flew!" +2022,vacation,84,greg,2022-03-02,3,,incubating,"3/8: look for 139, 4/20: orange in nest, 4/27: paper removed, 5/19: blue flag in nest, 6/1: pulled" +2022,vacation,84,greg,2022-03-08,,,empty,"3/8: look for 139, 4/20: orange in nest, 4/27: paper removed, 5/19: blue flag in nest, 6/1: pulled" +2022,vacation,84,greg,2022-03-15,,,empty,"3/8: look for 139, 4/20: orange in nest, 4/27: paper removed, 5/19: blue flag in nest, 6/1: pulled" +2022,vacation,84,greg,2022-03-22,,,empty,"3/8: look for 139, 4/20: orange in nest, 4/27: paper removed, 5/19: blue flag in nest, 6/1: pulled" +2022,vacation,84,greg,2022-03-30,,,empty,"3/8: look for 139, 4/20: orange in nest, 4/27: paper removed, 5/19: blue flag in nest, 6/1: pulled" +2022,vacation,84,greg,2022-04-06,,,empty,"3/8: look for 139, 4/20: orange in nest, 4/27: paper removed, 5/19: blue flag in nest, 6/1: pulled" +2022,vacation,84,greg,2022-04-13,,,empty,"3/8: look for 139, 4/20: orange in nest, 4/27: paper removed, 5/19: blue flag in nest, 6/1: pulled" +2022,vacation,84,greg,2022-04-20,,,empty,"3/8: look for 139, 4/20: orange in nest, 4/27: paper removed, 5/19: blue flag in nest, 6/1: pulled" +2022,vacation,84,greg,2022-04-27,,,empty,"3/8: look for 139, 4/20: orange in nest, 4/27: paper removed, 5/19: blue flag in nest, 6/1: pulled" +2022,vacation,84,greg,2022-05-04,,,empty,"3/8: look for 139, 4/20: orange in nest, 4/27: paper removed, 5/19: blue flag in nest, 6/1: pulled" +2022,vacation,84,greg,2022-05-13,,,empty,"3/8: look for 139, 4/20: orange in nest, 4/27: paper removed, 5/19: blue flag in nest, 6/1: pulled" +2022,vacation,84,greg,2022-05-19,,,empty,"3/8: look for 139, 4/20: orange in nest, 4/27: paper removed, 5/19: blue flag in nest, 6/1: pulled" +2022,vacation,84,greg,2022-05-26,,,empty,"3/8: look for 139, 4/20: orange in nest, 4/27: paper removed, 5/19: blue flag in nest, 6/1: pulled" +2022,vacation,84,greg,2022-06-01,,,,"3/8: look for 139, 4/20: orange in nest, 4/27: paper removed, 5/19: blue flag in nest, 6/1: pulled" +2022,vacation,84,greg,2022-06-09,,,,"3/8: look for 139, 4/20: orange in nest, 4/27: paper removed, 5/19: blue flag in nest, 6/1: pulled" +2022,vacation,82,greg,2022-03-02,1,,incubating,"4/20: orange in nest, 5/4: 2 branchlings, 5/13: yellow paper, 5/19: blue flagging nest, 6/1: pulled" +2022,vacation,82,greg,2022-03-08,,,empty,"4/20: orange in nest, 5/4: 2 branchlings, 5/13: yellow paper, 5/19: blue flagging nest, 6/1: pulled" +2022,vacation,82,greg,2022-03-15,,,empty,"4/20: orange in nest, 5/4: 2 branchlings, 5/13: yellow paper, 5/19: blue flagging nest, 6/1: pulled" +2022,vacation,82,greg,2022-03-22,,,empty,"4/20: orange in nest, 5/4: 2 branchlings, 5/13: yellow paper, 5/19: blue flagging nest, 6/1: pulled" +2022,vacation,82,greg,2022-03-30,,,empty,"4/20: orange in nest, 5/4: 2 branchlings, 5/13: yellow paper, 5/19: blue flagging nest, 6/1: pulled" +2022,vacation,82,greg,2022-04-06,,,empty,"4/20: orange in nest, 5/4: 2 branchlings, 5/13: yellow paper, 5/19: blue flagging nest, 6/1: pulled" +2022,vacation,82,greg,2022-04-13,,,empty,"4/20: orange in nest, 5/4: 2 branchlings, 5/13: yellow paper, 5/19: blue flagging nest, 6/1: pulled" +2022,vacation,82,greg,2022-04-20,,,empty,"4/20: orange in nest, 5/4: 2 branchlings, 5/13: yellow paper, 5/19: blue flagging nest, 6/1: pulled" +2022,vacation,82,greg,2022-04-27,,,empty,"4/20: orange in nest, 5/4: 2 branchlings, 5/13: yellow paper, 5/19: blue flagging nest, 6/1: pulled" +2022,vacation,82,greg,2022-05-04,,,empty,"4/20: orange in nest, 5/4: 2 branchlings, 5/13: yellow paper, 5/19: blue flagging nest, 6/1: pulled" +2022,vacation,82,greg,2022-05-13,,,,"4/20: orange in nest, 5/4: 2 branchlings, 5/13: yellow paper, 5/19: blue flagging nest, 6/1: pulled" +2022,vacation,82,greg,2022-05-19,,,empty,"4/20: orange in nest, 5/4: 2 branchlings, 5/13: yellow paper, 5/19: blue flagging nest, 6/1: pulled" +2022,vacation,82,greg,2022-05-26,,,empty,"4/20: orange in nest, 5/4: 2 branchlings, 5/13: yellow paper, 5/19: blue flagging nest, 6/1: pulled" +2022,vacation,82,greg,2022-06-01,,,,"4/20: orange in nest, 5/4: 2 branchlings, 5/13: yellow paper, 5/19: blue flagging nest, 6/1: pulled" +2022,vacation,82,greg,2022-06-09,,,,"4/20: orange in nest, 5/4: 2 branchlings, 5/13: yellow paper, 5/19: blue flagging nest, 6/1: pulled" +2022,vacation,86,greg,2022-03-02,1,,incubating,"3/30: chick wet, 4/20: chicks big, 4/27: 4c clustered between 86 and 88, 5/13: 2C in tree between 86 and 88, 5/19: blue flagging nest, 5/26: 86 and 88 in pond apple canopy, 6/1: pulled" +2022,vacation,86,greg,2022-03-08,3,,incubating,"3/30: chick wet, 4/20: chicks big, 4/27: 4c clustered between 86 and 88, 5/13: 2C in tree between 86 and 88, 5/19: blue flagging nest, 5/26: 86 and 88 in pond apple canopy, 6/1: pulled" +2022,vacation,86,greg,2022-03-15,3,,incubating,"3/30: chick wet, 4/20: chicks big, 4/27: 4c clustered between 86 and 88, 5/13: 2C in tree between 86 and 88, 5/19: blue flagging nest, 5/26: 86 and 88 in pond apple canopy, 6/1: pulled" +2022,vacation,86,greg,2022-03-22,3,,incubating,"3/30: chick wet, 4/20: chicks big, 4/27: 4c clustered between 86 and 88, 5/13: 2C in tree between 86 and 88, 5/19: blue flagging nest, 5/26: 86 and 88 in pond apple canopy, 6/1: pulled" +2022,vacation,86,greg,2022-03-30,2,1,wet_chick,"3/30: chick wet, 4/20: chicks big, 4/27: 4c clustered between 86 and 88, 5/13: 2C in tree between 86 and 88, 5/19: blue flagging nest, 5/26: 86 and 88 in pond apple canopy, 6/1: pulled" +2022,vacation,86,greg,2022-04-06,,3,nestling,"3/30: chick wet, 4/20: chicks big, 4/27: 4c clustered between 86 and 88, 5/13: 2C in tree between 86 and 88, 5/19: blue flagging nest, 5/26: 86 and 88 in pond apple canopy, 6/1: pulled" +2022,vacation,86,greg,2022-04-13,,3,nestling,"3/30: chick wet, 4/20: chicks big, 4/27: 4c clustered between 86 and 88, 5/13: 2C in tree between 86 and 88, 5/19: blue flagging nest, 5/26: 86 and 88 in pond apple canopy, 6/1: pulled" +2022,vacation,86,greg,2022-04-20,,2,nestling,"3/30: chick wet, 4/20: chicks big, 4/27: 4c clustered between 86 and 88, 5/13: 2C in tree between 86 and 88, 5/19: blue flagging nest, 5/26: 86 and 88 in pond apple canopy, 6/1: pulled" +2022,vacation,86,greg,2022-04-27,,2,nestling,"3/30: chick wet, 4/20: chicks big, 4/27: 4c clustered between 86 and 88, 5/13: 2C in tree between 86 and 88, 5/19: blue flagging nest, 5/26: 86 and 88 in pond apple canopy, 6/1: pulled" +2022,vacation,86,greg,2022-05-04,,,empty,"3/30: chick wet, 4/20: chicks big, 4/27: 4c clustered between 86 and 88, 5/13: 2C in tree between 86 and 88, 5/19: blue flagging nest, 5/26: 86 and 88 in pond apple canopy, 6/1: pulled" +2022,vacation,86,greg,2022-05-13,,,empty,"3/30: chick wet, 4/20: chicks big, 4/27: 4c clustered between 86 and 88, 5/13: 2C in tree between 86 and 88, 5/19: blue flagging nest, 5/26: 86 and 88 in pond apple canopy, 6/1: pulled" +2022,vacation,86,greg,2022-05-19,,,empty,"3/30: chick wet, 4/20: chicks big, 4/27: 4c clustered between 86 and 88, 5/13: 2C in tree between 86 and 88, 5/19: blue flagging nest, 5/26: 86 and 88 in pond apple canopy, 6/1: pulled" +2022,vacation,86,greg,2022-05-26,,,empty,"3/30: chick wet, 4/20: chicks big, 4/27: 4c clustered between 86 and 88, 5/13: 2C in tree between 86 and 88, 5/19: blue flagging nest, 5/26: 86 and 88 in pond apple canopy, 6/1: pulled" +2022,vacation,86,greg,2022-06-01,,,empty,"3/30: chick wet, 4/20: chicks big, 4/27: 4c clustered between 86 and 88, 5/13: 2C in tree between 86 and 88, 5/19: blue flagging nest, 5/26: 86 and 88 in pond apple canopy, 6/1: pulled" +2022,vacation,86,greg,2022-06-09,,,,"3/30: chick wet, 4/20: chicks big, 4/27: 4c clustered between 86 and 88, 5/13: 2C in tree between 86 and 88, 5/19: blue flagging nest, 5/26: 86 and 88 in pond apple canopy, 6/1: pulled" +2022,vacation,88,greg,2022-03-02,1,,incubating,"3/30: chick wet, 4/27: 4c clustered between 86 and 88, 6/1: pulled" +2022,vacation,88,greg,2022-03-08,3,,incubating,"3/30: chick wet, 4/27: 4c clustered between 86 and 88, 6/1: pulled" +2022,vacation,88,greg,2022-03-15,3,,incubating,"3/30: chick wet, 4/27: 4c clustered between 86 and 88, 6/1: pulled" +2022,vacation,88,greg,2022-03-22,3,,incubating,"3/30: chick wet, 4/27: 4c clustered between 86 and 88, 6/1: pulled" +2022,vacation,88,greg,2022-03-30,2,1,wet_chick,"3/30: chick wet, 4/27: 4c clustered between 86 and 88, 6/1: pulled" +2022,vacation,88,greg,2022-04-06,,3,nestling,"3/30: chick wet, 4/27: 4c clustered between 86 and 88, 6/1: pulled" +2022,vacation,88,greg,2022-04-13,,2,nestling,"3/30: chick wet, 4/27: 4c clustered between 86 and 88, 6/1: pulled" +2022,vacation,88,greg,2022-04-20,,2,nestling,"3/30: chick wet, 4/27: 4c clustered between 86 and 88, 6/1: pulled" +2022,vacation,88,greg,2022-04-27,,2,nestling,"3/30: chick wet, 4/27: 4c clustered between 86 and 88, 6/1: pulled" +2022,vacation,88,greg,2022-05-04,,,empty,"3/30: chick wet, 4/27: 4c clustered between 86 and 88, 6/1: pulled" +2022,vacation,88,greg,2022-05-13,,,empty,"3/30: chick wet, 4/27: 4c clustered between 86 and 88, 6/1: pulled" +2022,vacation,88,greg,2022-05-19,,,missed,"3/30: chick wet, 4/27: 4c clustered between 86 and 88, 6/1: pulled" +2022,vacation,88,greg,2022-05-26,,,empty,"3/30: chick wet, 4/27: 4c clustered between 86 and 88, 6/1: pulled" +2022,vacation,88,greg,2022-06-01,,,empty,"3/30: chick wet, 4/27: 4c clustered between 86 and 88, 6/1: pulled" +2022,vacation,88,greg,2022-06-09,,,,"3/30: chick wet, 4/27: 4c clustered between 86 and 88, 6/1: pulled" +2022,vacation,90,greg,2022-03-02,2,,incubating,"3/22: chicks dry, 4/20: 2C are branchlings, 4/27: 2 branchlings high in tree, 5/13: fledged, 6/1: pulled" +2022,vacation,90,greg,2022-03-08,2,,incubating,"3/22: chicks dry, 4/20: 2C are branchlings, 4/27: 2 branchlings high in tree, 5/13: fledged, 6/1: pulled" +2022,vacation,90,greg,2022-03-15,2,,incubating,"3/22: chicks dry, 4/20: 2C are branchlings, 4/27: 2 branchlings high in tree, 5/13: fledged, 6/1: pulled" +2022,vacation,90,greg,2022-03-22,,2,chick_dry,"3/22: chicks dry, 4/20: 2C are branchlings, 4/27: 2 branchlings high in tree, 5/13: fledged, 6/1: pulled" +2022,vacation,90,greg,2022-03-30,,2,nestling,"3/22: chicks dry, 4/20: 2C are branchlings, 4/27: 2 branchlings high in tree, 5/13: fledged, 6/1: pulled" +2022,vacation,90,greg,2022-04-06,,2,nestling,"3/22: chicks dry, 4/20: 2C are branchlings, 4/27: 2 branchlings high in tree, 5/13: fledged, 6/1: pulled" +2022,vacation,90,greg,2022-04-13,,2,nestling,"3/22: chicks dry, 4/20: 2C are branchlings, 4/27: 2 branchlings high in tree, 5/13: fledged, 6/1: pulled" +2022,vacation,90,greg,2022-04-20,,2,branchling,"3/22: chicks dry, 4/20: 2C are branchlings, 4/27: 2 branchlings high in tree, 5/13: fledged, 6/1: pulled" +2022,vacation,90,greg,2022-04-27,,,empty,"3/22: chicks dry, 4/20: 2C are branchlings, 4/27: 2 branchlings high in tree, 5/13: fledged, 6/1: pulled" +2022,vacation,90,greg,2022-05-04,,,empty,"3/22: chicks dry, 4/20: 2C are branchlings, 4/27: 2 branchlings high in tree, 5/13: fledged, 6/1: pulled" +2022,vacation,90,greg,2022-05-13,,,empty,"3/22: chicks dry, 4/20: 2C are branchlings, 4/27: 2 branchlings high in tree, 5/13: fledged, 6/1: pulled" +2022,vacation,90,greg,2022-05-19,,,empty,"3/22: chicks dry, 4/20: 2C are branchlings, 4/27: 2 branchlings high in tree, 5/13: fledged, 6/1: pulled" +2022,vacation,90,greg,2022-05-26,,,empty,"3/22: chicks dry, 4/20: 2C are branchlings, 4/27: 2 branchlings high in tree, 5/13: fledged, 6/1: pulled" +2022,vacation,90,greg,2022-06-01,,,empty,"3/22: chicks dry, 4/20: 2C are branchlings, 4/27: 2 branchlings high in tree, 5/13: fledged, 6/1: pulled" +2022,vacation,90,greg,2022-06-09,,,,"3/22: chicks dry, 4/20: 2C are branchlings, 4/27: 2 branchlings high in tree, 5/13: fledged, 6/1: pulled" +2022,vacation,125,greg,2022-03-02,,,,"Near 313. 3/30: collapsed/pulled" +2022,vacation,125,greg,2022-03-08,2,,incubating,"Near 313. 3/30: collapsed/pulled" +2022,vacation,125,greg,2022-03-15,3,,incubating,"Near 313. 3/30: collapsed/pulled" +2022,vacation,125,greg,2022-03-22,,,empty,"Near 313. 3/30: collapsed/pulled" +2022,vacation,125,greg,2022-03-30,,,collapsed,"Near 313. 3/30: collapsed/pulled" +2022,vacation,125,greg,2022-04-06,,,pulled,"Near 313. 3/30: collapsed/pulled" +2022,vacation,125,greg,2022-04-13,,,,"Near 313. 3/30: collapsed/pulled" +2022,vacation,125,greg,2022-04-20,,,,"Near 313. 3/30: collapsed/pulled" +2022,vacation,125,greg,2022-04-27,,,,"Near 313. 3/30: collapsed/pulled" +2022,vacation,125,greg,2022-05-04,,,,"Near 313. 3/30: collapsed/pulled" +2022,vacation,125,greg,2022-05-13,,,,"Near 313. 3/30: collapsed/pulled" +2022,vacation,125,greg,2022-05-19,,,,"Near 313. 3/30: collapsed/pulled" +2022,vacation,125,greg,2022-05-26,,,,"Near 313. 3/30: collapsed/pulled" +2022,vacation,125,greg,2022-06-01,,,,"Near 313. 3/30: collapsed/pulled" +2022,vacation,125,greg,2022-06-09,,,,"Near 313. 3/30: collapsed/pulled" +2022,vacation,127,greg,2022-03-02,,,,"3/30: 2E on ground, collapsed/pulled" +2022,vacation,127,greg,2022-03-08,3,,incubating,"3/30: 2E on ground, collapsed/pulled" +2022,vacation,127,greg,2022-03-15,3,,incubating,"3/30: 2E on ground, collapsed/pulled" +2022,vacation,127,greg,2022-03-22,3,,incubating,"3/30: 2E on ground, collapsed/pulled" +2022,vacation,127,greg,2022-03-30,,,collapsed,"3/30: 2E on ground, collapsed/pulled" +2022,vacation,127,greg,2022-04-06,,,pulled,"3/30: 2E on ground, collapsed/pulled" +2022,vacation,127,greg,2022-04-13,,,,"3/30: 2E on ground, collapsed/pulled" +2022,vacation,127,greg,2022-04-20,,,,"3/30: 2E on ground, collapsed/pulled" +2022,vacation,127,greg,2022-04-27,,,,"3/30: 2E on ground, collapsed/pulled" +2022,vacation,127,greg,2022-05-04,,,,"3/30: 2E on ground, collapsed/pulled" +2022,vacation,127,greg,2022-05-13,,,,"3/30: 2E on ground, collapsed/pulled" +2022,vacation,127,greg,2022-05-19,,,,"3/30: 2E on ground, collapsed/pulled" +2022,vacation,127,greg,2022-05-26,,,,"3/30: 2E on ground, collapsed/pulled" +2022,vacation,127,greg,2022-06-01,,,,"3/30: 2E on ground, collapsed/pulled" +2022,vacation,127,greg,2022-06-09,,,,"3/30: 2E on ground, collapsed/pulled" +2022,vacation,129,greg,2022-03-02,,,,"3/8: next to 66, 4/27: do mercury next week, 5/13: 3C in top of the tree, 5/19: blue flagging in nest, 6/1: pulled" +2022,vacation,129,greg,2022-03-08,2,,incubating,"3/8: next to 66, 4/27: do mercury next week, 5/13: 3C in top of the tree, 5/19: blue flagging in nest, 6/1: pulled" +2022,vacation,129,greg,2022-03-15,3,,incubating,"3/8: next to 66, 4/27: do mercury next week, 5/13: 3C in top of the tree, 5/19: blue flagging in nest, 6/1: pulled" +2022,vacation,129,greg,2022-03-22,3,,incubating,"3/8: next to 66, 4/27: do mercury next week, 5/13: 3C in top of the tree, 5/19: blue flagging in nest, 6/1: pulled" +2022,vacation,129,greg,2022-03-30,3,,incubating,"3/8: next to 66, 4/27: do mercury next week, 5/13: 3C in top of the tree, 5/19: blue flagging in nest, 6/1: pulled" +2022,vacation,129,greg,2022-04-06,,3,nestling,"3/8: next to 66, 4/27: do mercury next week, 5/13: 3C in top of the tree, 5/19: blue flagging in nest, 6/1: pulled" +2022,vacation,129,greg,2022-04-13,,3,nestling,"3/8: next to 66, 4/27: do mercury next week, 5/13: 3C in top of the tree, 5/19: blue flagging in nest, 6/1: pulled" +2022,vacation,129,greg,2022-04-20,,3,nestling,"3/8: next to 66, 4/27: do mercury next week, 5/13: 3C in top of the tree, 5/19: blue flagging in nest, 6/1: pulled" +2022,vacation,129,greg,2022-04-27,,3,nestling,"3/8: next to 66, 4/27: do mercury next week, 5/13: 3C in top of the tree, 5/19: blue flagging in nest, 6/1: pulled" +2022,vacation,129,greg,2022-05-04,,3,nestling,"3/8: next to 66, 4/27: do mercury next week, 5/13: 3C in top of the tree, 5/19: blue flagging in nest, 6/1: pulled" +2022,vacation,129,greg,2022-05-13,,,empty,"3/8: next to 66, 4/27: do mercury next week, 5/13: 3C in top of the tree, 5/19: blue flagging in nest, 6/1: pulled" +2022,vacation,129,greg,2022-05-19,,,empty,"3/8: next to 66, 4/27: do mercury next week, 5/13: 3C in top of the tree, 5/19: blue flagging in nest, 6/1: pulled" +2022,vacation,129,greg,2022-05-26,,,empty,"3/8: next to 66, 4/27: do mercury next week, 5/13: 3C in top of the tree, 5/19: blue flagging in nest, 6/1: pulled" +2022,vacation,129,greg,2022-06-01,,,,"3/8: next to 66, 4/27: do mercury next week, 5/13: 3C in top of the tree, 5/19: blue flagging in nest, 6/1: pulled" +2022,vacation,129,greg,2022-06-09,,,,"3/8: next to 66, 4/27: do mercury next week, 5/13: 3C in top of the tree, 5/19: blue flagging in nest, 6/1: pulled" +2022,vacation,131,greg,2022-03-02,,,,"3/15: eggshells on ground, 3/22: collapsed, pulled" +2022,vacation,131,greg,2022-03-08,1,,incubating,"3/15: eggshells on ground, 3/22: collapsed, pulled" +2022,vacation,131,greg,2022-03-15,1,,incubating,"3/15: eggshells on ground, 3/22: collapsed, pulled" +2022,vacation,131,greg,2022-03-22,,,empty,"3/15: eggshells on ground, 3/22: collapsed, pulled" +2022,vacation,131,greg,2022-03-30,,,,"3/15: eggshells on ground, 3/22: collapsed, pulled" +2022,vacation,131,greg,2022-04-06,,,,"3/15: eggshells on ground, 3/22: collapsed, pulled" +2022,vacation,131,greg,2022-04-13,,,,"3/15: eggshells on ground, 3/22: collapsed, pulled" +2022,vacation,131,greg,2022-04-20,,,,"3/15: eggshells on ground, 3/22: collapsed, pulled" +2022,vacation,131,greg,2022-04-27,,,,"3/15: eggshells on ground, 3/22: collapsed, pulled" +2022,vacation,131,greg,2022-05-04,,,,"3/15: eggshells on ground, 3/22: collapsed, pulled" +2022,vacation,131,greg,2022-05-13,,,,"3/15: eggshells on ground, 3/22: collapsed, pulled" +2022,vacation,131,greg,2022-05-19,,,,"3/15: eggshells on ground, 3/22: collapsed, pulled" +2022,vacation,131,greg,2022-05-26,,,,"3/15: eggshells on ground, 3/22: collapsed, pulled" +2022,vacation,131,greg,2022-06-01,,,,"3/15: eggshells on ground, 3/22: collapsed, pulled" +2022,vacation,131,greg,2022-06-09,,,,"3/15: eggshells on ground, 3/22: collapsed, pulled" +2022,vacation,133,greg,2022-03-02,,,,"3/22: chicks dry, 4/13: sampled for mercury, 4/20: 2C branchlings" +2022,vacation,133,greg,2022-03-08,2,,incubating,"3/22: chicks dry, 4/13: sampled for mercury, 4/20: 2C branchlings" +2022,vacation,133,greg,2022-03-15,2,,incubating,"3/22: chicks dry, 4/13: sampled for mercury, 4/20: 2C branchlings" +2022,vacation,133,greg,2022-03-22,,2,chick_dry,"3/22: chicks dry, 4/13: sampled for mercury, 4/20: 2C branchlings" +2022,vacation,133,greg,2022-03-30,,2,nestling,"3/22: chicks dry, 4/13: sampled for mercury, 4/20: 2C branchlings" +2022,vacation,133,greg,2022-04-06,,2,nestling,"3/22: chicks dry, 4/13: sampled for mercury, 4/20: 2C branchlings" +2022,vacation,133,greg,2022-04-13,,2,nestling,"3/22: chicks dry, 4/13: sampled for mercury, 4/20: 2C branchlings" +2022,vacation,133,greg,2022-04-20,,2,branchling,"3/22: chicks dry, 4/13: sampled for mercury, 4/20: 2C branchlings" +2022,vacation,133,greg,2022-04-27,,,empty,"3/22: chicks dry, 4/13: sampled for mercury, 4/20: 2C branchlings" +2022,vacation,133,greg,2022-05-04,,,empty,"3/22: chicks dry, 4/13: sampled for mercury, 4/20: 2C branchlings" +2022,vacation,133,greg,2022-05-13,,,missed,"3/22: chicks dry, 4/13: sampled for mercury, 4/20: 2C branchlings" +2022,vacation,133,greg,2022-05-19,,,missed,"3/22: chicks dry, 4/13: sampled for mercury, 4/20: 2C branchlings" +2022,vacation,133,greg,2022-05-26,,,missed,"3/22: chicks dry, 4/13: sampled for mercury, 4/20: 2C branchlings" +2022,vacation,133,greg,2022-06-01,,,missed,"3/22: chicks dry, 4/13: sampled for mercury, 4/20: 2C branchlings" +2022,vacation,133,greg,2022-06-09,,,,"3/22: chicks dry, 4/13: sampled for mercury, 4/20: 2C branchlings" +2022,vacation,135,greg,2022-03-02,,,,"4/13: drone--blue flagging, 4/27: paper removed, 5/19: blue flag in nest, 5/26: pink beside 3ft west, 6/1: pulled" +2022,vacation,135,greg,2022-03-08,1,,incubating,"4/13: drone--blue flagging, 4/27: paper removed, 5/19: blue flag in nest, 5/26: pink beside 3ft west, 6/1: pulled" +2022,vacation,135,greg,2022-03-15,3,,incubating,"4/13: drone--blue flagging, 4/27: paper removed, 5/19: blue flag in nest, 5/26: pink beside 3ft west, 6/1: pulled" +2022,vacation,135,greg,2022-03-22,3,,incubating,"4/13: drone--blue flagging, 4/27: paper removed, 5/19: blue flag in nest, 5/26: pink beside 3ft west, 6/1: pulled" +2022,vacation,135,greg,2022-03-30,3,,incubating,"4/13: drone--blue flagging, 4/27: paper removed, 5/19: blue flag in nest, 5/26: pink beside 3ft west, 6/1: pulled" +2022,vacation,135,greg,2022-04-06,,,empty,"4/13: drone--blue flagging, 4/27: paper removed, 5/19: blue flag in nest, 5/26: pink beside 3ft west, 6/1: pulled" +2022,vacation,135,greg,2022-04-13,,,empty,"4/13: drone--blue flagging, 4/27: paper removed, 5/19: blue flag in nest, 5/26: pink beside 3ft west, 6/1: pulled" +2022,vacation,135,greg,2022-04-20,,,empty,"4/13: drone--blue flagging, 4/27: paper removed, 5/19: blue flag in nest, 5/26: pink beside 3ft west, 6/1: pulled" +2022,vacation,135,greg,2022-04-27,,,empty,"4/13: drone--blue flagging, 4/27: paper removed, 5/19: blue flag in nest, 5/26: pink beside 3ft west, 6/1: pulled" +2022,vacation,135,greg,2022-05-04,,,empty,"4/13: drone--blue flagging, 4/27: paper removed, 5/19: blue flag in nest, 5/26: pink beside 3ft west, 6/1: pulled" +2022,vacation,135,greg,2022-05-13,,,,"4/13: drone--blue flagging, 4/27: paper removed, 5/19: blue flag in nest, 5/26: pink beside 3ft west, 6/1: pulled" +2022,vacation,135,greg,2022-05-19,,,empty,"4/13: drone--blue flagging, 4/27: paper removed, 5/19: blue flag in nest, 5/26: pink beside 3ft west, 6/1: pulled" +2022,vacation,135,greg,2022-05-26,,,empty,"4/13: drone--blue flagging, 4/27: paper removed, 5/19: blue flag in nest, 5/26: pink beside 3ft west, 6/1: pulled" +2022,vacation,135,greg,2022-06-01,,,,"4/13: drone--blue flagging, 4/27: paper removed, 5/19: blue flag in nest, 5/26: pink beside 3ft west, 6/1: pulled" +2022,vacation,135,greg,2022-06-09,,,,"4/13: drone--blue flagging, 4/27: paper removed, 5/19: blue flag in nest, 5/26: pink beside 3ft west, 6/1: pulled" +2022,vacation,137,greg,2022-03-02,,,,"3/22: may be new nest on top of old nest, 3/30: eggshells on ground and nest, 4/13: drone--blue flagging, 4/20: blue paper in nest, 4/27: paper removed, 5/26: gone, 6/1: pulled" +2022,vacation,137,greg,2022-03-08,1,,incubating,"3/22: may be new nest on top of old nest, 3/30: eggshells on ground and nest, 4/13: drone--blue flagging, 4/20: blue paper in nest, 4/27: paper removed, 5/26: gone, 6/1: pulled" +2022,vacation,137,greg,2022-03-15,,,empty,"3/22: may be new nest on top of old nest, 3/30: eggshells on ground and nest, 4/13: drone--blue flagging, 4/20: blue paper in nest, 4/27: paper removed, 5/26: gone, 6/1: pulled" +2022,vacation,137,greg,2022-03-22,2,,incubating,"3/22: may be new nest on top of old nest, 3/30: eggshells on ground and nest, 4/13: drone--blue flagging, 4/20: blue paper in nest, 4/27: paper removed, 5/26: gone, 6/1: pulled" +2022,vacation,137,greg,2022-03-30,,,empty,"3/22: may be new nest on top of old nest, 3/30: eggshells on ground and nest, 4/13: drone--blue flagging, 4/20: blue paper in nest, 4/27: paper removed, 5/26: gone, 6/1: pulled" +2022,vacation,137,greg,2022-04-06,,,empty,"3/22: may be new nest on top of old nest, 3/30: eggshells on ground and nest, 4/13: drone--blue flagging, 4/20: blue paper in nest, 4/27: paper removed, 5/26: gone, 6/1: pulled" +2022,vacation,137,greg,2022-04-13,,,empty,"3/22: may be new nest on top of old nest, 3/30: eggshells on ground and nest, 4/13: drone--blue flagging, 4/20: blue paper in nest, 4/27: paper removed, 5/26: gone, 6/1: pulled" +2022,vacation,137,greg,2022-04-20,,,empty,"3/22: may be new nest on top of old nest, 3/30: eggshells on ground and nest, 4/13: drone--blue flagging, 4/20: blue paper in nest, 4/27: paper removed, 5/26: gone, 6/1: pulled" +2022,vacation,137,greg,2022-04-27,,,empty,"3/22: may be new nest on top of old nest, 3/30: eggshells on ground and nest, 4/13: drone--blue flagging, 4/20: blue paper in nest, 4/27: paper removed, 5/26: gone, 6/1: pulled" +2022,vacation,137,greg,2022-05-04,,,collapsed,"3/22: may be new nest on top of old nest, 3/30: eggshells on ground and nest, 4/13: drone--blue flagging, 4/20: blue paper in nest, 4/27: paper removed, 5/26: gone, 6/1: pulled" +2022,vacation,137,greg,2022-05-13,,,,"3/22: may be new nest on top of old nest, 3/30: eggshells on ground and nest, 4/13: drone--blue flagging, 4/20: blue paper in nest, 4/27: paper removed, 5/26: gone, 6/1: pulled" +2022,vacation,137,greg,2022-05-19,,,,"3/22: may be new nest on top of old nest, 3/30: eggshells on ground and nest, 4/13: drone--blue flagging, 4/20: blue paper in nest, 4/27: paper removed, 5/26: gone, 6/1: pulled" +2022,vacation,137,greg,2022-05-26,,,,"3/22: may be new nest on top of old nest, 3/30: eggshells on ground and nest, 4/13: drone--blue flagging, 4/20: blue paper in nest, 4/27: paper removed, 5/26: gone, 6/1: pulled" +2022,vacation,137,greg,2022-06-01,,,,"3/22: may be new nest on top of old nest, 3/30: eggshells on ground and nest, 4/13: drone--blue flagging, 4/20: blue paper in nest, 4/27: paper removed, 5/26: gone, 6/1: pulled" +2022,vacation,137,greg,2022-06-09,,,,"3/22: may be new nest on top of old nest, 3/30: eggshells on ground and nest, 4/13: drone--blue flagging, 4/20: blue paper in nest, 4/27: paper removed, 5/26: gone, 6/1: pulled" +2022,vacation,139,greg,2022-03-02,,,,"3/8: off trail to the left of 84, 3/22: 1 chick alive and one chick dead, 4/13: ready for mercury next week, a little off transect, 4/20: branchlings, 4/29: 2 branchlings high in tree" +2022,vacation,139,greg,2022-03-08,3,,incubating,"3/8: off trail to the left of 84, 3/22: 1 chick alive and one chick dead, 4/13: ready for mercury next week, a little off transect, 4/20: branchlings, 4/29: 2 branchlings high in tree" +2022,vacation,139,greg,2022-03-15,3,,incubating,"3/8: off trail to the left of 84, 3/22: 1 chick alive and one chick dead, 4/13: ready for mercury next week, a little off transect, 4/20: branchlings, 4/29: 2 branchlings high in tree" +2022,vacation,139,greg,2022-03-22,1,1,hatching,"3/8: off trail to the left of 84, 3/22: 1 chick alive and one chick dead, 4/13: ready for mercury next week, a little off transect, 4/20: branchlings, 4/29: 2 branchlings high in tree" +2022,vacation,139,greg,2022-03-30,,2,nestling,"3/8: off trail to the left of 84, 3/22: 1 chick alive and one chick dead, 4/13: ready for mercury next week, a little off transect, 4/20: branchlings, 4/29: 2 branchlings high in tree" +2022,vacation,139,greg,2022-04-06,,2,incubating,"3/8: off trail to the left of 84, 3/22: 1 chick alive and one chick dead, 4/13: ready for mercury next week, a little off transect, 4/20: branchlings, 4/29: 2 branchlings high in tree" +2022,vacation,139,greg,2022-04-13,,2,nestling,"3/8: off trail to the left of 84, 3/22: 1 chick alive and one chick dead, 4/13: ready for mercury next week, a little off transect, 4/20: branchlings, 4/29: 2 branchlings high in tree" +2022,vacation,139,greg,2022-04-20,,2,branchling,"3/8: off trail to the left of 84, 3/22: 1 chick alive and one chick dead, 4/13: ready for mercury next week, a little off transect, 4/20: branchlings, 4/29: 2 branchlings high in tree" +2022,vacation,139,greg,2022-04-27,,2,branchling,"3/8: off trail to the left of 84, 3/22: 1 chick alive and one chick dead, 4/13: ready for mercury next week, a little off transect, 4/20: branchlings, 4/29: 2 branchlings high in tree" +2022,vacation,139,greg,2022-05-04,,,empty,"3/8: off trail to the left of 84, 3/22: 1 chick alive and one chick dead, 4/13: ready for mercury next week, a little off transect, 4/20: branchlings, 4/29: 2 branchlings high in tree" +2022,vacation,139,greg,2022-05-13,,,empty,"3/8: off trail to the left of 84, 3/22: 1 chick alive and one chick dead, 4/13: ready for mercury next week, a little off transect, 4/20: branchlings, 4/29: 2 branchlings high in tree" +2022,vacation,139,greg,2022-05-19,,,missed,"3/8: off trail to the left of 84, 3/22: 1 chick alive and one chick dead, 4/13: ready for mercury next week, a little off transect, 4/20: branchlings, 4/29: 2 branchlings high in tree" +2022,vacation,139,greg,2022-05-26,,,,"3/8: off trail to the left of 84, 3/22: 1 chick alive and one chick dead, 4/13: ready for mercury next week, a little off transect, 4/20: branchlings, 4/29: 2 branchlings high in tree" +2022,vacation,139,greg,2022-06-01,,,,"3/8: off trail to the left of 84, 3/22: 1 chick alive and one chick dead, 4/13: ready for mercury next week, a little off transect, 4/20: branchlings, 4/29: 2 branchlings high in tree" +2022,vacation,139,greg,2022-06-09,,,,"3/8: off trail to the left of 84, 3/22: 1 chick alive and one chick dead, 4/13: ready for mercury next week, a little off transect, 4/20: branchlings, 4/29: 2 branchlings high in tree" +2022,vacation,141,greg,2022-03-02,,,,"3/8: near 88, 4/6: one egg open in nest, 4/20: 2c are branchlings, 5/4: 2 branchlings in tree, 5/13: 2C huge branchlings and green paper besides nest, 5/19: blue flagging to east, 6/1: pulled" +2022,vacation,141,greg,2022-03-08,2,,incubating,"3/8: near 88, 4/6: one egg open in nest, 4/20: 2c are branchlings, 5/4: 2 branchlings in tree, 5/13: 2C huge branchlings and green paper besides nest, 5/19: blue flagging to east, 6/1: pulled" +2022,vacation,141,greg,2022-03-15,3,,incubating,"3/8: near 88, 4/6: one egg open in nest, 4/20: 2c are branchlings, 5/4: 2 branchlings in tree, 5/13: 2C huge branchlings and green paper besides nest, 5/19: blue flagging to east, 6/1: pulled" +2022,vacation,141,greg,2022-03-22,3,,incubating,"3/8: near 88, 4/6: one egg open in nest, 4/20: 2c are branchlings, 5/4: 2 branchlings in tree, 5/13: 2C huge branchlings and green paper besides nest, 5/19: blue flagging to east, 6/1: pulled" +2022,vacation,141,greg,2022-03-30,3,,incubating,"3/8: near 88, 4/6: one egg open in nest, 4/20: 2c are branchlings, 5/4: 2 branchlings in tree, 5/13: 2C huge branchlings and green paper besides nest, 5/19: blue flagging to east, 6/1: pulled" +2022,vacation,141,greg,2022-04-06,,2,incubating,"3/8: near 88, 4/6: one egg open in nest, 4/20: 2c are branchlings, 5/4: 2 branchlings in tree, 5/13: 2C huge branchlings and green paper besides nest, 5/19: blue flagging to east, 6/1: pulled" +2022,vacation,141,greg,2022-04-13,,2,nestling,"3/8: near 88, 4/6: one egg open in nest, 4/20: 2c are branchlings, 5/4: 2 branchlings in tree, 5/13: 2C huge branchlings and green paper besides nest, 5/19: blue flagging to east, 6/1: pulled" +2022,vacation,141,greg,2022-04-20,,2,branchling,"3/8: near 88, 4/6: one egg open in nest, 4/20: 2c are branchlings, 5/4: 2 branchlings in tree, 5/13: 2C huge branchlings and green paper besides nest, 5/19: blue flagging to east, 6/1: pulled" +2022,vacation,141,greg,2022-04-27,,,missed,"3/8: near 88, 4/6: one egg open in nest, 4/20: 2c are branchlings, 5/4: 2 branchlings in tree, 5/13: 2C huge branchlings and green paper besides nest, 5/19: blue flagging to east, 6/1: pulled" +2022,vacation,141,greg,2022-05-04,,,empty,"3/8: near 88, 4/6: one egg open in nest, 4/20: 2c are branchlings, 5/4: 2 branchlings in tree, 5/13: 2C huge branchlings and green paper besides nest, 5/19: blue flagging to east, 6/1: pulled" +2022,vacation,141,greg,2022-05-13,,2,branchling,"3/8: near 88, 4/6: one egg open in nest, 4/20: 2c are branchlings, 5/4: 2 branchlings in tree, 5/13: 2C huge branchlings and green paper besides nest, 5/19: blue flagging to east, 6/1: pulled" +2022,vacation,141,greg,2022-05-19,,,empty,"3/8: near 88, 4/6: one egg open in nest, 4/20: 2c are branchlings, 5/4: 2 branchlings in tree, 5/13: 2C huge branchlings and green paper besides nest, 5/19: blue flagging to east, 6/1: pulled" +2022,vacation,141,greg,2022-05-26,,,empty,"3/8: near 88, 4/6: one egg open in nest, 4/20: 2c are branchlings, 5/4: 2 branchlings in tree, 5/13: 2C huge branchlings and green paper besides nest, 5/19: blue flagging to east, 6/1: pulled" +2022,vacation,141,greg,2022-06-01,,,empty,"3/8: near 88, 4/6: one egg open in nest, 4/20: 2c are branchlings, 5/4: 2 branchlings in tree, 5/13: 2C huge branchlings and green paper besides nest, 5/19: blue flagging to east, 6/1: pulled" +2022,vacation,141,greg,2022-06-09,,,,"3/8: near 88, 4/6: one egg open in nest, 4/20: 2c are branchlings, 5/4: 2 branchlings in tree, 5/13: 2C huge branchlings and green paper besides nest, 5/19: blue flagging to east, 6/1: pulled" +2022,vacation,143,gbhe,2022-03-02,,,,"3/8: near 90 and 64, 4/6: 2 eggshells on ground, 5/13: 1C and 1C dead in nest" +2022,vacation,143,gbhe,2022-03-08,1,,incubating,"3/8: near 90 and 64, 4/6: 2 eggshells on ground, 5/13: 1C and 1C dead in nest" +2022,vacation,143,gbhe,2022-03-15,3,,incubating,"3/8: near 90 and 64, 4/6: 2 eggshells on ground, 5/13: 1C and 1C dead in nest" +2022,vacation,143,gbhe,2022-03-22,3,,incubating,"3/8: near 90 and 64, 4/6: 2 eggshells on ground, 5/13: 1C and 1C dead in nest" +2022,vacation,143,gbhe,2022-03-30,3,,incubating,"3/8: near 90 and 64, 4/6: 2 eggshells on ground, 5/13: 1C and 1C dead in nest" +2022,vacation,143,gbhe,2022-04-06,1,1,hatching,"3/8: near 90 and 64, 4/6: 2 eggshells on ground, 5/13: 1C and 1C dead in nest" +2022,vacation,143,gbhe,2022-04-13,,1,nestling,"3/8: near 90 and 64, 4/6: 2 eggshells on ground, 5/13: 1C and 1C dead in nest" +2022,vacation,143,gbhe,2022-04-20,,2,nestling,"3/8: near 90 and 64, 4/6: 2 eggshells on ground, 5/13: 1C and 1C dead in nest" +2022,vacation,143,gbhe,2022-04-27,,2,nestling,"3/8: near 90 and 64, 4/6: 2 eggshells on ground, 5/13: 1C and 1C dead in nest" +2022,vacation,143,gbhe,2022-05-04,,,missed,"3/8: near 90 and 64, 4/6: 2 eggshells on ground, 5/13: 1C and 1C dead in nest" +2022,vacation,143,gbhe,2022-05-13,,1,nestling,"3/8: near 90 and 64, 4/6: 2 eggshells on ground, 5/13: 1C and 1C dead in nest" +2022,vacation,143,gbhe,2022-05-19,,1,nestling,"3/8: near 90 and 64, 4/6: 2 eggshells on ground, 5/13: 1C and 1C dead in nest" +2022,vacation,143,gbhe,2022-05-26,,1,nestling,"3/8: near 90 and 64, 4/6: 2 eggshells on ground, 5/13: 1C and 1C dead in nest" +2022,vacation,143,gbhe,2022-06-01,,1,nestling,"3/8: near 90 and 64, 4/6: 2 eggshells on ground, 5/13: 1C and 1C dead in nest" +2022,vacation,143,gbhe,2022-06-09,,1,nestling,"3/8: near 90 and 64, 4/6: 2 eggshells on ground, 5/13: 1C and 1C dead in nest" +2022,vacation,145,greg,2022-03-02,,,,"4/6: dry chicks, 4/20: 2c are branchlings, 4/27: do mercury next week, 5/4: 2 branchlings in tree, 5/13: 1C in the tree, 5/19: 1C in tree, 5/26: orange paper, 6/1: pulled" +2022,vacation,145,greg,2022-03-08,2,,incubating,"4/6: dry chicks, 4/20: 2c are branchlings, 4/27: do mercury next week, 5/4: 2 branchlings in tree, 5/13: 1C in the tree, 5/19: 1C in tree, 5/26: orange paper, 6/1: pulled" +2022,vacation,145,greg,2022-03-15,2,,incubating,"4/6: dry chicks, 4/20: 2c are branchlings, 4/27: do mercury next week, 5/4: 2 branchlings in tree, 5/13: 1C in the tree, 5/19: 1C in tree, 5/26: orange paper, 6/1: pulled" +2022,vacation,145,greg,2022-03-22,2,,incubating,"4/6: dry chicks, 4/20: 2c are branchlings, 4/27: do mercury next week, 5/4: 2 branchlings in tree, 5/13: 1C in the tree, 5/19: 1C in tree, 5/26: orange paper, 6/1: pulled" +2022,vacation,145,greg,2022-03-30,2,,incubating,"4/6: dry chicks, 4/20: 2c are branchlings, 4/27: do mercury next week, 5/4: 2 branchlings in tree, 5/13: 1C in the tree, 5/19: 1C in tree, 5/26: orange paper, 6/1: pulled" +2022,vacation,145,greg,2022-04-06,,2,incubating,"4/6: dry chicks, 4/20: 2c are branchlings, 4/27: do mercury next week, 5/4: 2 branchlings in tree, 5/13: 1C in the tree, 5/19: 1C in tree, 5/26: orange paper, 6/1: pulled" +2022,vacation,145,greg,2022-04-13,,2,nestling,"4/6: dry chicks, 4/20: 2c are branchlings, 4/27: do mercury next week, 5/4: 2 branchlings in tree, 5/13: 1C in the tree, 5/19: 1C in tree, 5/26: orange paper, 6/1: pulled" +2022,vacation,145,greg,2022-04-20,,2,branchling,"4/6: dry chicks, 4/20: 2c are branchlings, 4/27: do mercury next week, 5/4: 2 branchlings in tree, 5/13: 1C in the tree, 5/19: 1C in tree, 5/26: orange paper, 6/1: pulled" +2022,vacation,145,greg,2022-04-27,,2,nestling,"4/6: dry chicks, 4/20: 2c are branchlings, 4/27: do mercury next week, 5/4: 2 branchlings in tree, 5/13: 1C in the tree, 5/19: 1C in tree, 5/26: orange paper, 6/1: pulled" +2022,vacation,145,greg,2022-05-04,,,empty,"4/6: dry chicks, 4/20: 2c are branchlings, 4/27: do mercury next week, 5/4: 2 branchlings in tree, 5/13: 1C in the tree, 5/19: 1C in tree, 5/26: orange paper, 6/1: pulled" +2022,vacation,145,greg,2022-05-13,,,empty,"4/6: dry chicks, 4/20: 2c are branchlings, 4/27: do mercury next week, 5/4: 2 branchlings in tree, 5/13: 1C in the tree, 5/19: 1C in tree, 5/26: orange paper, 6/1: pulled" +2022,vacation,145,greg,2022-05-19,,,empty,"4/6: dry chicks, 4/20: 2c are branchlings, 4/27: do mercury next week, 5/4: 2 branchlings in tree, 5/13: 1C in the tree, 5/19: 1C in tree, 5/26: orange paper, 6/1: pulled" +2022,vacation,145,greg,2022-05-26,,,empty,"4/6: dry chicks, 4/20: 2c are branchlings, 4/27: do mercury next week, 5/4: 2 branchlings in tree, 5/13: 1C in the tree, 5/19: 1C in tree, 5/26: orange paper, 6/1: pulled" +2022,vacation,145,greg,2022-06-01,,,empty,"4/6: dry chicks, 4/20: 2c are branchlings, 4/27: do mercury next week, 5/4: 2 branchlings in tree, 5/13: 1C in the tree, 5/19: 1C in tree, 5/26: orange paper, 6/1: pulled" +2022,vacation,145,greg,2022-06-09,,,,"4/6: dry chicks, 4/20: 2c are branchlings, 4/27: do mercury next week, 5/4: 2 branchlings in tree, 5/13: 1C in the tree, 5/19: 1C in tree, 5/26: orange paper, 6/1: pulled" +2022,vacation,147,greg,2022-03-02,,,,"4/6: dry chicks, 4/20: 2c are branchlings, 5/13: yellow paper, 5/19: blue flagging in nest, 5/26: blue flagging, 6/1: pulled" +2022,vacation,147,greg,2022-03-08,2,,incubating,"4/6: dry chicks, 4/20: 2c are branchlings, 5/13: yellow paper, 5/19: blue flagging in nest, 5/26: blue flagging, 6/1: pulled" +2022,vacation,147,greg,2022-03-15,3,,incubating,"4/6: dry chicks, 4/20: 2c are branchlings, 5/13: yellow paper, 5/19: blue flagging in nest, 5/26: blue flagging, 6/1: pulled" +2022,vacation,147,greg,2022-03-22,3,,incubating,"4/6: dry chicks, 4/20: 2c are branchlings, 5/13: yellow paper, 5/19: blue flagging in nest, 5/26: blue flagging, 6/1: pulled" +2022,vacation,147,greg,2022-03-30,3,,incubating,"4/6: dry chicks, 4/20: 2c are branchlings, 5/13: yellow paper, 5/19: blue flagging in nest, 5/26: blue flagging, 6/1: pulled" +2022,vacation,147,greg,2022-04-06,,3,incubating,"4/6: dry chicks, 4/20: 2c are branchlings, 5/13: yellow paper, 5/19: blue flagging in nest, 5/26: blue flagging, 6/1: pulled" +2022,vacation,147,greg,2022-04-13,,2,nestling,"4/6: dry chicks, 4/20: 2c are branchlings, 5/13: yellow paper, 5/19: blue flagging in nest, 5/26: blue flagging, 6/1: pulled" +2022,vacation,147,greg,2022-04-20,,2,branchling,"4/6: dry chicks, 4/20: 2c are branchlings, 5/13: yellow paper, 5/19: blue flagging in nest, 5/26: blue flagging, 6/1: pulled" +2022,vacation,147,greg,2022-04-27,,,empty,"4/6: dry chicks, 4/20: 2c are branchlings, 5/13: yellow paper, 5/19: blue flagging in nest, 5/26: blue flagging, 6/1: pulled" +2022,vacation,147,greg,2022-05-04,,,empty,"4/6: dry chicks, 4/20: 2c are branchlings, 5/13: yellow paper, 5/19: blue flagging in nest, 5/26: blue flagging, 6/1: pulled" +2022,vacation,147,greg,2022-05-13,,,empty,"4/6: dry chicks, 4/20: 2c are branchlings, 5/13: yellow paper, 5/19: blue flagging in nest, 5/26: blue flagging, 6/1: pulled" +2022,vacation,147,greg,2022-05-19,,,empty,"4/6: dry chicks, 4/20: 2c are branchlings, 5/13: yellow paper, 5/19: blue flagging in nest, 5/26: blue flagging, 6/1: pulled" +2022,vacation,147,greg,2022-05-26,,,empty,"4/6: dry chicks, 4/20: 2c are branchlings, 5/13: yellow paper, 5/19: blue flagging in nest, 5/26: blue flagging, 6/1: pulled" +2022,vacation,147,greg,2022-06-01,,,empty,"4/6: dry chicks, 4/20: 2c are branchlings, 5/13: yellow paper, 5/19: blue flagging in nest, 5/26: blue flagging, 6/1: pulled" +2022,vacation,147,greg,2022-06-09,,,,"4/6: dry chicks, 4/20: 2c are branchlings, 5/13: yellow paper, 5/19: blue flagging in nest, 5/26: blue flagging, 6/1: pulled" +2022,vacation,151,greg,2022-03-02,,,,"4/6: dry chick, 5/4: possibly more chicks, 5/13: 1+C fledged, 5/26: canopy pond apple, 6/1: pulled" +2022,vacation,151,greg,2022-03-08,2,,incubating,"4/6: dry chick, 5/4: possibly more chicks, 5/13: 1+C fledged, 5/26: canopy pond apple, 6/1: pulled" +2022,vacation,151,greg,2022-03-15,3,,incubating,"4/6: dry chick, 5/4: possibly more chicks, 5/13: 1+C fledged, 5/26: canopy pond apple, 6/1: pulled" +2022,vacation,151,greg,2022-03-22,3,,incubating,"4/6: dry chick, 5/4: possibly more chicks, 5/13: 1+C fledged, 5/26: canopy pond apple, 6/1: pulled" +2022,vacation,151,greg,2022-03-30,3,,incubating,"4/6: dry chick, 5/4: possibly more chicks, 5/13: 1+C fledged, 5/26: canopy pond apple, 6/1: pulled" +2022,vacation,151,greg,2022-04-06,,3,incubating,"4/6: dry chick, 5/4: possibly more chicks, 5/13: 1+C fledged, 5/26: canopy pond apple, 6/1: pulled" +2022,vacation,151,greg,2022-04-13,,3,nestling,"4/6: dry chick, 5/4: possibly more chicks, 5/13: 1+C fledged, 5/26: canopy pond apple, 6/1: pulled" +2022,vacation,151,greg,2022-04-20,,3,nestling,"4/6: dry chick, 5/4: possibly more chicks, 5/13: 1+C fledged, 5/26: canopy pond apple, 6/1: pulled" +2022,vacation,151,greg,2022-04-27,,3,nestling,"4/6: dry chick, 5/4: possibly more chicks, 5/13: 1+C fledged, 5/26: canopy pond apple, 6/1: pulled" +2022,vacation,151,greg,2022-05-04,,1,nestling,"4/6: dry chick, 5/4: possibly more chicks, 5/13: 1+C fledged, 5/26: canopy pond apple, 6/1: pulled" +2022,vacation,151,greg,2022-05-13,,,empty,"4/6: dry chick, 5/4: possibly more chicks, 5/13: 1+C fledged, 5/26: canopy pond apple, 6/1: pulled" +2022,vacation,151,greg,2022-05-19,,,empty,"4/6: dry chick, 5/4: possibly more chicks, 5/13: 1+C fledged, 5/26: canopy pond apple, 6/1: pulled" +2022,vacation,151,greg,2022-05-26,,,empty,"4/6: dry chick, 5/4: possibly more chicks, 5/13: 1+C fledged, 5/26: canopy pond apple, 6/1: pulled" +2022,vacation,151,greg,2022-06-01,,,,"4/6: dry chick, 5/4: possibly more chicks, 5/13: 1+C fledged, 5/26: canopy pond apple, 6/1: pulled" +2022,vacation,151,greg,2022-06-09,,,,"4/6: dry chick, 5/4: possibly more chicks, 5/13: 1+C fledged, 5/26: canopy pond apple, 6/1: pulled" +2022,vacation,196,greg,2022-03-02,,,,"4/6: eggshells on ground" +2022,vacation,196,greg,2022-03-08,,,,"4/6: eggshells on ground" +2022,vacation,196,greg,2022-03-15,1,,incubating,"4/6: eggshells on ground" +2022,vacation,196,greg,2022-03-22,2,,incubating,"4/6: eggshells on ground" +2022,vacation,196,greg,2022-03-30,2,,incubating,"4/6: eggshells on ground" +2022,vacation,196,greg,2022-04-06,,,empty,"4/6: eggshells on ground" +2022,vacation,196,greg,2022-04-13,,,missed,"4/6: eggshells on ground" +2022,vacation,196,greg,2022-04-20,1,,incubating,"4/6: eggshells on ground" +2022,vacation,196,greg,2022-04-27,,,empty,"4/6: eggshells on ground" +2022,vacation,196,greg,2022-05-04,,,empty,"4/6: eggshells on ground" +2022,vacation,196,greg,2022-05-13,,,empty,"4/6: eggshells on ground" +2022,vacation,196,greg,2022-05-19,,,empty,"4/6: eggshells on ground" +2022,vacation,196,greg,2022-05-26,,,empty,"4/6: eggshells on ground" +2022,vacation,196,greg,2022-06-01,,,,"4/6: eggshells on ground" +2022,vacation,196,greg,2022-06-09,,,,"4/6: eggshells on ground" +2022,vacation,198,greg,2022-03-02,,,,"4/6: eggshells on ground" +2022,vacation,198,greg,2022-03-08,,,,"4/6: eggshells on ground" +2022,vacation,198,greg,2022-03-15,1,,incubating,"4/6: eggshells on ground" +2022,vacation,198,greg,2022-03-22,2,,incubating,"4/6: eggshells on ground" +2022,vacation,198,greg,2022-03-30,2,,incubating,"4/6: eggshells on ground" +2022,vacation,198,greg,2022-04-06,,,empty,"4/6: eggshells on ground" +2022,vacation,198,greg,2022-04-13,,,,"4/6: eggshells on ground" +2022,vacation,198,greg,2022-04-20,,,,"4/6: eggshells on ground" +2022,vacation,198,greg,2022-04-27,,,,"4/6: eggshells on ground" +2022,vacation,198,greg,2022-05-04,,,,"4/6: eggshells on ground" +2022,vacation,198,greg,2022-05-13,,,,"4/6: eggshells on ground" +2022,vacation,198,greg,2022-05-19,,,,"4/6: eggshells on ground" +2022,vacation,198,greg,2022-05-26,,,missed,"4/6: eggshells on ground" +2022,vacation,198,greg,2022-06-01,,,,"4/6: eggshells on ground" +2022,vacation,198,greg,2022-06-09,,,,"4/6: eggshells on ground" +2022,vacation,98,greg,2022-03-02,,,,"5/13: green paper #9, 6/1: pulled" +2022,vacation,98,greg,2022-03-08,,,,"5/13: green paper #9, 6/1: pulled" +2022,vacation,98,greg,2022-03-15,3,,incubating,"5/13: green paper #9, 6/1: pulled" +2022,vacation,98,greg,2022-03-22,,,empty,"5/13: green paper #9, 6/1: pulled" +2022,vacation,98,greg,2022-03-30,,,empty,"5/13: green paper #9, 6/1: pulled" +2022,vacation,98,greg,2022-04-06,,,empty,"5/13: green paper #9, 6/1: pulled" +2022,vacation,98,greg,2022-04-13,,,empty,"5/13: green paper #9, 6/1: pulled" +2022,vacation,98,greg,2022-04-20,,,empty,"5/13: green paper #9, 6/1: pulled" +2022,vacation,98,greg,2022-04-27,,,collapsed,"5/13: green paper #9, 6/1: pulled" +2022,vacation,98,greg,2022-05-04,,,collapsed,"5/13: green paper #9, 6/1: pulled" +2022,vacation,98,greg,2022-05-13,,,collapsed,"5/13: green paper #9, 6/1: pulled" +2022,vacation,98,greg,2022-05-19,,,collapsed,"5/13: green paper #9, 6/1: pulled" +2022,vacation,98,greg,2022-05-26,,,missed,"5/13: green paper #9, 6/1: pulled" +2022,vacation,98,greg,2022-06-01,,,,"5/13: green paper #9, 6/1: pulled" +2022,vacation,98,greg,2022-06-09,,,,"5/13: green paper #9, 6/1: pulled" +2022,vacation,100,greg,2022-03-02,,,,"Off transect to right of 143. 4/20: green paper near nest, 5/19: blue flagging in nest, 5/26: blue flagging, 6/1: pulled" +2022,vacation,100,greg,2022-03-08,,,,"Off transect to right of 143. 4/20: green paper near nest, 5/19: blue flagging in nest, 5/26: blue flagging, 6/1: pulled" +2022,vacation,100,greg,2022-03-15,2,,incubating,"Off transect to right of 143. 4/20: green paper near nest, 5/19: blue flagging in nest, 5/26: blue flagging, 6/1: pulled" +2022,vacation,100,greg,2022-03-22,3,,incubating,"Off transect to right of 143. 4/20: green paper near nest, 5/19: blue flagging in nest, 5/26: blue flagging, 6/1: pulled" +2022,vacation,100,greg,2022-03-30,,,missed,"Off transect to right of 143. 4/20: green paper near nest, 5/19: blue flagging in nest, 5/26: blue flagging, 6/1: pulled" +2022,vacation,100,greg,2022-04-06,3,,incubating,"Off transect to right of 143. 4/20: green paper near nest, 5/19: blue flagging in nest, 5/26: blue flagging, 6/1: pulled" +2022,vacation,100,greg,2022-04-13,,,missed,"Off transect to right of 143. 4/20: green paper near nest, 5/19: blue flagging in nest, 5/26: blue flagging, 6/1: pulled" +2022,vacation,100,greg,2022-04-20,,3,nestling,"Off transect to right of 143. 4/20: green paper near nest, 5/19: blue flagging in nest, 5/26: blue flagging, 6/1: pulled" +2022,vacation,100,greg,2022-04-27,,3,nestling,"Off transect to right of 143. 4/20: green paper near nest, 5/19: blue flagging in nest, 5/26: blue flagging, 6/1: pulled" +2022,vacation,100,greg,2022-05-04,,,missed,"Off transect to right of 143. 4/20: green paper near nest, 5/19: blue flagging in nest, 5/26: blue flagging, 6/1: pulled" +2022,vacation,100,greg,2022-05-13,,,missed,"Off transect to right of 143. 4/20: green paper near nest, 5/19: blue flagging in nest, 5/26: blue flagging, 6/1: pulled" +2022,vacation,100,greg,2022-05-19,,,empty,"Off transect to right of 143. 4/20: green paper near nest, 5/19: blue flagging in nest, 5/26: blue flagging, 6/1: pulled" +2022,vacation,100,greg,2022-05-26,,,empty,"Off transect to right of 143. 4/20: green paper near nest, 5/19: blue flagging in nest, 5/26: blue flagging, 6/1: pulled" +2022,vacation,100,greg,2022-06-01,,,empty,"Off transect to right of 143. 4/20: green paper near nest, 5/19: blue flagging in nest, 5/26: blue flagging, 6/1: pulled" +2022,vacation,100,greg,2022-06-09,,,,"Off transect to right of 143. 4/20: green paper near nest, 5/19: blue flagging in nest, 5/26: blue flagging, 6/1: pulled" +2022,vacation,311,greg,2022-03-02,,,,"4/20: dry, young chick, 5/26: orange paper and blue flagging 6' north pond apple, 6/1: pulled" +2022,vacation,311,greg,2022-03-08,,,,"4/20: dry, young chick, 5/26: orange paper and blue flagging 6' north pond apple, 6/1: pulled" +2022,vacation,311,greg,2022-03-15,,,,"4/20: dry, young chick, 5/26: orange paper and blue flagging 6' north pond apple, 6/1: pulled" +2022,vacation,311,greg,2022-03-22,1,,incubating,"4/20: dry, young chick, 5/26: orange paper and blue flagging 6' north pond apple, 6/1: pulled" +2022,vacation,311,greg,2022-03-30,1,,incubating,"4/20: dry, young chick, 5/26: orange paper and blue flagging 6' north pond apple, 6/1: pulled" +2022,vacation,311,greg,2022-04-06,1,,incubating,"4/20: dry, young chick, 5/26: orange paper and blue flagging 6' north pond apple, 6/1: pulled" +2022,vacation,311,greg,2022-04-13,1,,incubating,"4/20: dry, young chick, 5/26: orange paper and blue flagging 6' north pond apple, 6/1: pulled" +2022,vacation,311,greg,2022-04-20,,1,chick_dry,"4/20: dry, young chick, 5/26: orange paper and blue flagging 6' north pond apple, 6/1: pulled" +2022,vacation,311,greg,2022-04-27,,1,nestling,"4/20: dry, young chick, 5/26: orange paper and blue flagging 6' north pond apple, 6/1: pulled" +2022,vacation,311,greg,2022-05-04,,1,nestling,"4/20: dry, young chick, 5/26: orange paper and blue flagging 6' north pond apple, 6/1: pulled" +2022,vacation,311,greg,2022-05-13,,1,nestling,"4/20: dry, young chick, 5/26: orange paper and blue flagging 6' north pond apple, 6/1: pulled" +2022,vacation,311,greg,2022-05-19,,1,nestling,"4/20: dry, young chick, 5/26: orange paper and blue flagging 6' north pond apple, 6/1: pulled" +2022,vacation,311,greg,2022-05-26,,1,nestling,"4/20: dry, young chick, 5/26: orange paper and blue flagging 6' north pond apple, 6/1: pulled" +2022,vacation,311,greg,2022-06-01,,,empty,"4/20: dry, young chick, 5/26: orange paper and blue flagging 6' north pond apple, 6/1: pulled" +2022,vacation,311,greg,2022-06-09,,,,"4/20: dry, young chick, 5/26: orange paper and blue flagging 6' north pond apple, 6/1: pulled" +2022,vacation,197,greg,2022-03-02,,,,"4/13: both dry, 4/20: chicks BIG, 5/13: orange to west of nest, 5/19: 1+C in tree, 5/26: pink 8' to west, 6/1: pulled" +2022,vacation,197,greg,2022-03-08,,,,"4/13: both dry, 4/20: chicks BIG, 5/13: orange to west of nest, 5/19: 1+C in tree, 5/26: pink 8' to west, 6/1: pulled" +2022,vacation,197,greg,2022-03-15,,,,"4/13: both dry, 4/20: chicks BIG, 5/13: orange to west of nest, 5/19: 1+C in tree, 5/26: pink 8' to west, 6/1: pulled" +2022,vacation,197,greg,2022-03-22,3,,incubating,"4/13: both dry, 4/20: chicks BIG, 5/13: orange to west of nest, 5/19: 1+C in tree, 5/26: pink 8' to west, 6/1: pulled" +2022,vacation,197,greg,2022-03-30,3,,incubating,"4/13: both dry, 4/20: chicks BIG, 5/13: orange to west of nest, 5/19: 1+C in tree, 5/26: pink 8' to west, 6/1: pulled" +2022,vacation,197,greg,2022-04-06,3,,incubating,"4/13: both dry, 4/20: chicks BIG, 5/13: orange to west of nest, 5/19: 1+C in tree, 5/26: pink 8' to west, 6/1: pulled" +2022,vacation,197,greg,2022-04-13,1,2,chick_dry,"4/13: both dry, 4/20: chicks BIG, 5/13: orange to west of nest, 5/19: 1+C in tree, 5/26: pink 8' to west, 6/1: pulled" +2022,vacation,197,greg,2022-04-20,,2,nestling,"4/13: both dry, 4/20: chicks BIG, 5/13: orange to west of nest, 5/19: 1+C in tree, 5/26: pink 8' to west, 6/1: pulled" +2022,vacation,197,greg,2022-04-27,,,missed,"4/13: both dry, 4/20: chicks BIG, 5/13: orange to west of nest, 5/19: 1+C in tree, 5/26: pink 8' to west, 6/1: pulled" +2022,vacation,197,greg,2022-05-04,,2,nestling,"4/13: both dry, 4/20: chicks BIG, 5/13: orange to west of nest, 5/19: 1+C in tree, 5/26: pink 8' to west, 6/1: pulled" +2022,vacation,197,greg,2022-05-13,,2,nestling,"4/13: both dry, 4/20: chicks BIG, 5/13: orange to west of nest, 5/19: 1+C in tree, 5/26: pink 8' to west, 6/1: pulled" +2022,vacation,197,greg,2022-05-19,,1,branchling,"4/13: both dry, 4/20: chicks BIG, 5/13: orange to west of nest, 5/19: 1+C in tree, 5/26: pink 8' to west, 6/1: pulled" +2022,vacation,197,greg,2022-05-26,,1,nestling,"4/13: both dry, 4/20: chicks BIG, 5/13: orange to west of nest, 5/19: 1+C in tree, 5/26: pink 8' to west, 6/1: pulled" +2022,vacation,197,greg,2022-06-01,,,empty,"4/13: both dry, 4/20: chicks BIG, 5/13: orange to west of nest, 5/19: 1+C in tree, 5/26: pink 8' to west, 6/1: pulled" +2022,vacation,197,greg,2022-06-09,,,,"4/13: both dry, 4/20: chicks BIG, 5/13: orange to west of nest, 5/19: 1+C in tree, 5/26: pink 8' to west, 6/1: pulled" +2022,vacation,199,greg,2022-03-02,,,,"4/13: nest gone, 4/20: nest gone, 5/13: yellow paper #3, 5/19: removed yellow, 5/26: blue to SW 8' in canopy pond apple, gone" +2022,vacation,199,greg,2022-03-08,,,,"4/13: nest gone, 4/20: nest gone, 5/13: yellow paper #3, 5/19: removed yellow, 5/26: blue to SW 8' in canopy pond apple, gone" +2022,vacation,199,greg,2022-03-15,,,,"4/13: nest gone, 4/20: nest gone, 5/13: yellow paper #3, 5/19: removed yellow, 5/26: blue to SW 8' in canopy pond apple, gone" +2022,vacation,199,greg,2022-03-22,2,,incubating,"4/13: nest gone, 4/20: nest gone, 5/13: yellow paper #3, 5/19: removed yellow, 5/26: blue to SW 8' in canopy pond apple, gone" +2022,vacation,199,greg,2022-03-30,2,,incubating,"4/13: nest gone, 4/20: nest gone, 5/13: yellow paper #3, 5/19: removed yellow, 5/26: blue to SW 8' in canopy pond apple, gone" +2022,vacation,199,greg,2022-04-06,2,,incubating,"4/13: nest gone, 4/20: nest gone, 5/13: yellow paper #3, 5/19: removed yellow, 5/26: blue to SW 8' in canopy pond apple, gone" +2022,vacation,199,greg,2022-04-13,,,empty,"4/13: nest gone, 4/20: nest gone, 5/13: yellow paper #3, 5/19: removed yellow, 5/26: blue to SW 8' in canopy pond apple, gone" +2022,vacation,199,greg,2022-04-20,,,,"4/13: nest gone, 4/20: nest gone, 5/13: yellow paper #3, 5/19: removed yellow, 5/26: blue to SW 8' in canopy pond apple, gone" +2022,vacation,199,greg,2022-04-27,,,,"4/13: nest gone, 4/20: nest gone, 5/13: yellow paper #3, 5/19: removed yellow, 5/26: blue to SW 8' in canopy pond apple, gone" +2022,vacation,199,greg,2022-05-04,,,,"4/13: nest gone, 4/20: nest gone, 5/13: yellow paper #3, 5/19: removed yellow, 5/26: blue to SW 8' in canopy pond apple, gone" +2022,vacation,199,greg,2022-05-13,,,,"4/13: nest gone, 4/20: nest gone, 5/13: yellow paper #3, 5/19: removed yellow, 5/26: blue to SW 8' in canopy pond apple, gone" +2022,vacation,199,greg,2022-05-19,,,,"4/13: nest gone, 4/20: nest gone, 5/13: yellow paper #3, 5/19: removed yellow, 5/26: blue to SW 8' in canopy pond apple, gone" +2022,vacation,199,greg,2022-05-26,,,collapsed,"4/13: nest gone, 4/20: nest gone, 5/13: yellow paper #3, 5/19: removed yellow, 5/26: blue to SW 8' in canopy pond apple, gone" +2022,vacation,199,greg,2022-06-01,,,empty,"4/13: nest gone, 4/20: nest gone, 5/13: yellow paper #3, 5/19: removed yellow, 5/26: blue to SW 8' in canopy pond apple, gone" +2022,vacation,199,greg,2022-06-09,,,,"4/13: nest gone, 4/20: nest gone, 5/13: yellow paper #3, 5/19: removed yellow, 5/26: blue to SW 8' in canopy pond apple, gone" +2022,vacation,313,greg,2022-03-02,,,,"4/13: both pipping, chick dry, 4/27: do mercury next week, 5/13: sampled, 5/26: yellow 10' to SE" +2022,vacation,313,greg,2022-03-08,,,,"4/13: both pipping, chick dry, 4/27: do mercury next week, 5/13: sampled, 5/26: yellow 10' to SE" +2022,vacation,313,greg,2022-03-15,,,,"4/13: both pipping, chick dry, 4/27: do mercury next week, 5/13: sampled, 5/26: yellow 10' to SE" +2022,vacation,313,greg,2022-03-22,3,,incubating,"4/13: both pipping, chick dry, 4/27: do mercury next week, 5/13: sampled, 5/26: yellow 10' to SE" +2022,vacation,313,greg,2022-03-30,3,,incubating,"4/13: both pipping, chick dry, 4/27: do mercury next week, 5/13: sampled, 5/26: yellow 10' to SE" +2022,vacation,313,greg,2022-04-06,3,,incubating,"4/13: both pipping, chick dry, 4/27: do mercury next week, 5/13: sampled, 5/26: yellow 10' to SE" +2022,vacation,313,greg,2022-04-13,2,1,pipping,"4/13: both pipping, chick dry, 4/27: do mercury next week, 5/13: sampled, 5/26: yellow 10' to SE" +2022,vacation,313,greg,2022-04-20,,3,nestling,"4/13: both pipping, chick dry, 4/27: do mercury next week, 5/13: sampled, 5/26: yellow 10' to SE" +2022,vacation,313,greg,2022-04-27,,3,nestling,"4/13: both pipping, chick dry, 4/27: do mercury next week, 5/13: sampled, 5/26: yellow 10' to SE" +2022,vacation,313,greg,2022-05-04,,3,nestling,"4/13: both pipping, chick dry, 4/27: do mercury next week, 5/13: sampled, 5/26: yellow 10' to SE" +2022,vacation,313,greg,2022-05-13,,3,nestling,"4/13: both pipping, chick dry, 4/27: do mercury next week, 5/13: sampled, 5/26: yellow 10' to SE" +2022,vacation,313,greg,2022-05-19,,3,nestling,"4/13: both pipping, chick dry, 4/27: do mercury next week, 5/13: sampled, 5/26: yellow 10' to SE" +2022,vacation,313,greg,2022-05-26,,3,nestling,"4/13: both pipping, chick dry, 4/27: do mercury next week, 5/13: sampled, 5/26: yellow 10' to SE" +2022,vacation,313,greg,2022-06-01,,,empty,"4/13: both pipping, chick dry, 4/27: do mercury next week, 5/13: sampled, 5/26: yellow 10' to SE" +2022,vacation,313,greg,2022-06-09,,,,"4/13: both pipping, chick dry, 4/27: do mercury next week, 5/13: sampled, 5/26: yellow 10' to SE" +2022,vacation,315,greg,2022-03-02,,,,"4/13: second egg pipping, chick wet, 5/13: 2C in tree, 5/19: blue flagging beside nest, 6/1: pulled" +2022,vacation,315,greg,2022-03-08,,,,"4/13: second egg pipping, chick wet, 5/13: 2C in tree, 5/19: blue flagging beside nest, 6/1: pulled" +2022,vacation,315,greg,2022-03-15,,,,"4/13: second egg pipping, chick wet, 5/13: 2C in tree, 5/19: blue flagging beside nest, 6/1: pulled" +2022,vacation,315,greg,2022-03-22,2,,incubating,"4/13: second egg pipping, chick wet, 5/13: 2C in tree, 5/19: blue flagging beside nest, 6/1: pulled" +2022,vacation,315,greg,2022-03-30,2,,incubating,"4/13: second egg pipping, chick wet, 5/13: 2C in tree, 5/19: blue flagging beside nest, 6/1: pulled" +2022,vacation,315,greg,2022-04-06,2,,incubating,"4/13: second egg pipping, chick wet, 5/13: 2C in tree, 5/19: blue flagging beside nest, 6/1: pulled" +2022,vacation,315,greg,2022-04-13,1,1,wet_chick,"4/13: second egg pipping, chick wet, 5/13: 2C in tree, 5/19: blue flagging beside nest, 6/1: pulled" +2022,vacation,315,greg,2022-04-20,,2,nestling,"4/13: second egg pipping, chick wet, 5/13: 2C in tree, 5/19: blue flagging beside nest, 6/1: pulled" +2022,vacation,315,greg,2022-04-27,,2,nestling,"4/13: second egg pipping, chick wet, 5/13: 2C in tree, 5/19: blue flagging beside nest, 6/1: pulled" +2022,vacation,315,greg,2022-05-04,,2,nestling,"4/13: second egg pipping, chick wet, 5/13: 2C in tree, 5/19: blue flagging beside nest, 6/1: pulled" +2022,vacation,315,greg,2022-05-13,,,empty,"4/13: second egg pipping, chick wet, 5/13: 2C in tree, 5/19: blue flagging beside nest, 6/1: pulled" +2022,vacation,315,greg,2022-05-19,,,empty,"4/13: second egg pipping, chick wet, 5/13: 2C in tree, 5/19: blue flagging beside nest, 6/1: pulled" +2022,vacation,315,greg,2022-05-26,,,empty,"4/13: second egg pipping, chick wet, 5/13: 2C in tree, 5/19: blue flagging beside nest, 6/1: pulled" +2022,vacation,315,greg,2022-06-01,,,,"4/13: second egg pipping, chick wet, 5/13: 2C in tree, 5/19: blue flagging beside nest, 6/1: pulled" +2022,vacation,315,greg,2022-06-09,,,,"4/13: second egg pipping, chick wet, 5/13: 2C in tree, 5/19: blue flagging beside nest, 6/1: pulled" +2022,vacation,201,greg,2022-03-02,,,,"5/13: green paper 4 feet to west in tree, sampled mercury, 5/26: 201 and 74 in same pond apple 317 in tree to East" +2022,vacation,201,greg,2022-03-08,,,,"5/13: green paper 4 feet to west in tree, sampled mercury, 5/26: 201 and 74 in same pond apple 317 in tree to East" +2022,vacation,201,greg,2022-03-15,,,,"5/13: green paper 4 feet to west in tree, sampled mercury, 5/26: 201 and 74 in same pond apple 317 in tree to East" +2022,vacation,201,greg,2022-03-22,2,,incubating,"5/13: green paper 4 feet to west in tree, sampled mercury, 5/26: 201 and 74 in same pond apple 317 in tree to East" +2022,vacation,201,greg,2022-03-30,2,,incubating,"5/13: green paper 4 feet to west in tree, sampled mercury, 5/26: 201 and 74 in same pond apple 317 in tree to East" +2022,vacation,201,greg,2022-04-06,2,,incubating,"5/13: green paper 4 feet to west in tree, sampled mercury, 5/26: 201 and 74 in same pond apple 317 in tree to East" +2022,vacation,201,greg,2022-04-13,1,1,hatching,"5/13: green paper 4 feet to west in tree, sampled mercury, 5/26: 201 and 74 in same pond apple 317 in tree to East" +2022,vacation,201,greg,2022-04-20,1,1,hatching,"5/13: green paper 4 feet to west in tree, sampled mercury, 5/26: 201 and 74 in same pond apple 317 in tree to East" +2022,vacation,201,greg,2022-04-27,1,1,hatching,"5/13: green paper 4 feet to west in tree, sampled mercury, 5/26: 201 and 74 in same pond apple 317 in tree to East" +2022,vacation,201,greg,2022-05-04,,1,nestling,"5/13: green paper 4 feet to west in tree, sampled mercury, 5/26: 201 and 74 in same pond apple 317 in tree to East" +2022,vacation,201,greg,2022-05-13,,1,nestling,"5/13: green paper 4 feet to west in tree, sampled mercury, 5/26: 201 and 74 in same pond apple 317 in tree to East" +2022,vacation,201,greg,2022-05-19,,1,nestling,"5/13: green paper 4 feet to west in tree, sampled mercury, 5/26: 201 and 74 in same pond apple 317 in tree to East" +2022,vacation,201,greg,2022-05-26,,,empty,"5/13: green paper 4 feet to west in tree, sampled mercury, 5/26: 201 and 74 in same pond apple 317 in tree to East" +2022,vacation,201,greg,2022-06-01,,,empty,"5/13: green paper 4 feet to west in tree, sampled mercury, 5/26: 201 and 74 in same pond apple 317 in tree to East" +2022,vacation,201,greg,2022-06-09,,,,"5/13: green paper 4 feet to west in tree, sampled mercury, 5/26: 201 and 74 in same pond apple 317 in tree to East" +2022,vacation,317,greg,2022-03-02,,,,"4/20: 2c+, 5/4: possibly another chick, 5/13: certain, 5/26: 2C+ not sure if they are from this nest" +2022,vacation,317,greg,2022-03-08,,,,"4/20: 2c+, 5/4: possibly another chick, 5/13: certain, 5/26: 2C+ not sure if they are from this nest" +2022,vacation,317,greg,2022-03-15,,,,"4/20: 2c+, 5/4: possibly another chick, 5/13: certain, 5/26: 2C+ not sure if they are from this nest" +2022,vacation,317,greg,2022-03-22,2,,incubating,"4/20: 2c+, 5/4: possibly another chick, 5/13: certain, 5/26: 2C+ not sure if they are from this nest" +2022,vacation,317,greg,2022-03-30,,,missed,"4/20: 2c+, 5/4: possibly another chick, 5/13: certain, 5/26: 2C+ not sure if they are from this nest" +2022,vacation,317,greg,2022-04-06,2,,incubating,"4/20: 2c+, 5/4: possibly another chick, 5/13: certain, 5/26: 2C+ not sure if they are from this nest" +2022,vacation,317,greg,2022-04-13,,,missed,"4/20: 2c+, 5/4: possibly another chick, 5/13: certain, 5/26: 2C+ not sure if they are from this nest" +2022,vacation,317,greg,2022-04-20,,2,nestling,"4/20: 2c+, 5/4: possibly another chick, 5/13: certain, 5/26: 2C+ not sure if they are from this nest" +2022,vacation,317,greg,2022-04-27,,2,nestling,"4/20: 2c+, 5/4: possibly another chick, 5/13: certain, 5/26: 2C+ not sure if they are from this nest" +2022,vacation,317,greg,2022-05-04,,1,nestling,"4/20: 2c+, 5/4: possibly another chick, 5/13: certain, 5/26: 2C+ not sure if they are from this nest" +2022,vacation,317,greg,2022-05-13,,2,nestling,"4/20: 2c+, 5/4: possibly another chick, 5/13: certain, 5/26: 2C+ not sure if they are from this nest" +2022,vacation,317,greg,2022-05-19,,,missed,"4/20: 2c+, 5/4: possibly another chick, 5/13: certain, 5/26: 2C+ not sure if they are from this nest" +2022,vacation,317,greg,2022-05-26,,2,branchling,"4/20: 2c+, 5/4: possibly another chick, 5/13: certain, 5/26: 2C+ not sure if they are from this nest" +2022,vacation,317,greg,2022-06-01,,,missed,"4/20: 2c+, 5/4: possibly another chick, 5/13: certain, 5/26: 2C+ not sure if they are from this nest" +2022,vacation,317,greg,2022-06-09,,,,"4/20: 2c+, 5/4: possibly another chick, 5/13: certain, 5/26: 2C+ not sure if they are from this nest" +2022,vacation,203,greg,2022-03-02,,,,"4/13: chicks dry, 4/27: do mercury next week, 5/13: 3+C, sampled mercury, 5/19: chicks on tree canopy, 5/26: blue flagging under - pond apple" +2022,vacation,203,greg,2022-03-08,,,,"4/13: chicks dry, 4/27: do mercury next week, 5/13: 3+C, sampled mercury, 5/19: chicks on tree canopy, 5/26: blue flagging under - pond apple" +2022,vacation,203,greg,2022-03-15,,,,"4/13: chicks dry, 4/27: do mercury next week, 5/13: 3+C, sampled mercury, 5/19: chicks on tree canopy, 5/26: blue flagging under - pond apple" +2022,vacation,203,greg,2022-03-22,2,,incubating,"4/13: chicks dry, 4/27: do mercury next week, 5/13: 3+C, sampled mercury, 5/19: chicks on tree canopy, 5/26: blue flagging under - pond apple" +2022,vacation,203,greg,2022-03-30,3,,incubating,"4/13: chicks dry, 4/27: do mercury next week, 5/13: 3+C, sampled mercury, 5/19: chicks on tree canopy, 5/26: blue flagging under - pond apple" +2022,vacation,203,greg,2022-04-06,3,,incubating,"4/13: chicks dry, 4/27: do mercury next week, 5/13: 3+C, sampled mercury, 5/19: chicks on tree canopy, 5/26: blue flagging under - pond apple" +2022,vacation,203,greg,2022-04-13,1,2,chick_dry,"4/13: chicks dry, 4/27: do mercury next week, 5/13: 3+C, sampled mercury, 5/19: chicks on tree canopy, 5/26: blue flagging under - pond apple" +2022,vacation,203,greg,2022-04-20,,3,nestling,"4/13: chicks dry, 4/27: do mercury next week, 5/13: 3+C, sampled mercury, 5/19: chicks on tree canopy, 5/26: blue flagging under - pond apple" +2022,vacation,203,greg,2022-04-27,,3,nestling,"4/13: chicks dry, 4/27: do mercury next week, 5/13: 3+C, sampled mercury, 5/19: chicks on tree canopy, 5/26: blue flagging under - pond apple" +2022,vacation,203,greg,2022-05-04,,3,nestling,"4/13: chicks dry, 4/27: do mercury next week, 5/13: 3+C, sampled mercury, 5/19: chicks on tree canopy, 5/26: blue flagging under - pond apple" +2022,vacation,203,greg,2022-05-13,,3,nestling,"4/13: chicks dry, 4/27: do mercury next week, 5/13: 3+C, sampled mercury, 5/19: chicks on tree canopy, 5/26: blue flagging under - pond apple" +2022,vacation,203,greg,2022-05-19,,3,branchling,"4/13: chicks dry, 4/27: do mercury next week, 5/13: 3+C, sampled mercury, 5/19: chicks on tree canopy, 5/26: blue flagging under - pond apple" +2022,vacation,203,greg,2022-05-26,,,empty,"4/13: chicks dry, 4/27: do mercury next week, 5/13: 3+C, sampled mercury, 5/19: chicks on tree canopy, 5/26: blue flagging under - pond apple" +2022,vacation,203,greg,2022-06-01,,,,"4/13: chicks dry, 4/27: do mercury next week, 5/13: 3+C, sampled mercury, 5/19: chicks on tree canopy, 5/26: blue flagging under - pond apple" +2022,vacation,203,greg,2022-06-09,,,,"4/13: chicks dry, 4/27: do mercury next week, 5/13: 3+C, sampled mercury, 5/19: chicks on tree canopy, 5/26: blue flagging under - pond apple" +2022,vacation,319,greg,2022-03-02,,,,"5/13: orange paper #8, 5/19: gone, 5/26: blue paper - pond apple, 6/1: pulled" +2022,vacation,319,greg,2022-03-08,,,,"5/13: orange paper #8, 5/19: gone, 5/26: blue paper - pond apple, 6/1: pulled" +2022,vacation,319,greg,2022-03-15,,,,"5/13: orange paper #8, 5/19: gone, 5/26: blue paper - pond apple, 6/1: pulled" +2022,vacation,319,greg,2022-03-22,2,,incubating,"5/13: orange paper #8, 5/19: gone, 5/26: blue paper - pond apple, 6/1: pulled" +2022,vacation,319,greg,2022-03-30,2,,incubating,"5/13: orange paper #8, 5/19: gone, 5/26: blue paper - pond apple, 6/1: pulled" +2022,vacation,319,greg,2022-04-06,2,,incubating,"5/13: orange paper #8, 5/19: gone, 5/26: blue paper - pond apple, 6/1: pulled" +2022,vacation,319,greg,2022-04-13,,,empty,"5/13: orange paper #8, 5/19: gone, 5/26: blue paper - pond apple, 6/1: pulled" +2022,vacation,319,greg,2022-04-20,,,empty,"5/13: orange paper #8, 5/19: gone, 5/26: blue paper - pond apple, 6/1: pulled" +2022,vacation,319,greg,2022-04-27,,,empty,"5/13: orange paper #8, 5/19: gone, 5/26: blue paper - pond apple, 6/1: pulled" +2022,vacation,319,greg,2022-05-04,,,empty,"5/13: orange paper #8, 5/19: gone, 5/26: blue paper - pond apple, 6/1: pulled" +2022,vacation,319,greg,2022-05-13,,,empty,"5/13: orange paper #8, 5/19: gone, 5/26: blue paper - pond apple, 6/1: pulled" +2022,vacation,319,greg,2022-05-19,,,collapsed,"5/13: orange paper #8, 5/19: gone, 5/26: blue paper - pond apple, 6/1: pulled" +2022,vacation,319,greg,2022-05-26,,,empty,"5/13: orange paper #8, 5/19: gone, 5/26: blue paper - pond apple, 6/1: pulled" +2022,vacation,319,greg,2022-06-01,,,,"5/13: orange paper #8, 5/19: gone, 5/26: blue paper - pond apple, 6/1: pulled" +2022,vacation,319,greg,2022-06-09,,,,"5/13: orange paper #8, 5/19: gone, 5/26: blue paper - pond apple, 6/1: pulled" +2022,vacation,205,greg,2022-03-02,,,,"Near 84. 5/19: blue flag in nest, 6/1: pulled" +2022,vacation,205,greg,2022-03-08,,,,"Near 84. 5/19: blue flag in nest, 6/1: pulled" +2022,vacation,205,greg,2022-03-15,,,,"Near 84. 5/19: blue flag in nest, 6/1: pulled" +2022,vacation,205,greg,2022-03-22,2,,incubating,"Near 84. 5/19: blue flag in nest, 6/1: pulled" +2022,vacation,205,greg,2022-03-30,2,,incubating,"Near 84. 5/19: blue flag in nest, 6/1: pulled" +2022,vacation,205,greg,2022-04-06,2,,incubating,"Near 84. 5/19: blue flag in nest, 6/1: pulled" +2022,vacation,205,greg,2022-04-13,2,,incubating,"Near 84. 5/19: blue flag in nest, 6/1: pulled" +2022,vacation,205,greg,2022-04-20,,2,nestling,"Near 84. 5/19: blue flag in nest, 6/1: pulled" +2022,vacation,205,greg,2022-04-27,,2,nestling,"Near 84. 5/19: blue flag in nest, 6/1: pulled" +2022,vacation,205,greg,2022-05-04,,2,nestling,"Near 84. 5/19: blue flag in nest, 6/1: pulled" +2022,vacation,205,greg,2022-05-13,,,empty,"Near 84. 5/19: blue flag in nest, 6/1: pulled" +2022,vacation,205,greg,2022-05-19,,,empty,"Near 84. 5/19: blue flag in nest, 6/1: pulled" +2022,vacation,205,greg,2022-05-26,,,empty,"Near 84. 5/19: blue flag in nest, 6/1: pulled" +2022,vacation,205,greg,2022-06-01,,,,"Near 84. 5/19: blue flag in nest, 6/1: pulled" +2022,vacation,205,greg,2022-06-09,,,,"Near 84. 5/19: blue flag in nest, 6/1: pulled" +2022,vacation,207,greg,2022-03-02,,,,"Off trail near 98 (left of transect). Off transet 15m to left before 82. 4/20: pink paper in nest, 4/27: paper removed, 5/13: orange in nest#9" +2022,vacation,207,greg,2022-03-08,,,,"Off trail near 98 (left of transect). Off transet 15m to left before 82. 4/20: pink paper in nest, 4/27: paper removed, 5/13: orange in nest#9" +2022,vacation,207,greg,2022-03-15,,,,"Off trail near 98 (left of transect). Off transet 15m to left before 82. 4/20: pink paper in nest, 4/27: paper removed, 5/13: orange in nest#9" +2022,vacation,207,greg,2022-03-22,2,,incubating,"Off trail near 98 (left of transect). Off transet 15m to left before 82. 4/20: pink paper in nest, 4/27: paper removed, 5/13: orange in nest#9" +2022,vacation,207,greg,2022-03-30,,,missed,"Off trail near 98 (left of transect). Off transet 15m to left before 82. 4/20: pink paper in nest, 4/27: paper removed, 5/13: orange in nest#9" +2022,vacation,207,greg,2022-04-06,,2,nestling,"Off trail near 98 (left of transect). Off transet 15m to left before 82. 4/20: pink paper in nest, 4/27: paper removed, 5/13: orange in nest#9" +2022,vacation,207,greg,2022-04-13,,1,nestling,"Off trail near 98 (left of transect). Off transet 15m to left before 82. 4/20: pink paper in nest, 4/27: paper removed, 5/13: orange in nest#9" +2022,vacation,207,greg,2022-04-20,,,empty,"Off trail near 98 (left of transect). Off transet 15m to left before 82. 4/20: pink paper in nest, 4/27: paper removed, 5/13: orange in nest#9" +2022,vacation,207,greg,2022-04-27,,,empty,"Off trail near 98 (left of transect). Off transet 15m to left before 82. 4/20: pink paper in nest, 4/27: paper removed, 5/13: orange in nest#9" +2022,vacation,207,greg,2022-05-04,,,empty,"Off trail near 98 (left of transect). Off transet 15m to left before 82. 4/20: pink paper in nest, 4/27: paper removed, 5/13: orange in nest#9" +2022,vacation,207,greg,2022-05-13,,,collapsed,"Off trail near 98 (left of transect). Off transet 15m to left before 82. 4/20: pink paper in nest, 4/27: paper removed, 5/13: orange in nest#9" +2022,vacation,207,greg,2022-05-19,,,,"Off trail near 98 (left of transect). Off transet 15m to left before 82. 4/20: pink paper in nest, 4/27: paper removed, 5/13: orange in nest#9" +2022,vacation,207,greg,2022-05-26,,,missed,"Off trail near 98 (left of transect). Off transet 15m to left before 82. 4/20: pink paper in nest, 4/27: paper removed, 5/13: orange in nest#9" +2022,vacation,207,greg,2022-06-01,,,,"Off trail near 98 (left of transect). Off transet 15m to left before 82. 4/20: pink paper in nest, 4/27: paper removed, 5/13: orange in nest#9" +2022,vacation,207,greg,2022-06-09,,,,"Off trail near 98 (left of transect). Off transet 15m to left before 82. 4/20: pink paper in nest, 4/27: paper removed, 5/13: orange in nest#9" +2022,vacation,209,greg,2022-03-02,,,,"4/13: chick very wet, 5/13: sampled mercury, 5/19: 1+ in tree, 5/26: canopy pond apple, 6/1: pulled" +2022,vacation,209,greg,2022-03-08,,,,"4/13: chick very wet, 5/13: sampled mercury, 5/19: 1+ in tree, 5/26: canopy pond apple, 6/1: pulled" +2022,vacation,209,greg,2022-03-15,,,,"4/13: chick very wet, 5/13: sampled mercury, 5/19: 1+ in tree, 5/26: canopy pond apple, 6/1: pulled" +2022,vacation,209,greg,2022-03-22,2,,incubating,"4/13: chick very wet, 5/13: sampled mercury, 5/19: 1+ in tree, 5/26: canopy pond apple, 6/1: pulled" +2022,vacation,209,greg,2022-03-30,2,,incubating,"4/13: chick very wet, 5/13: sampled mercury, 5/19: 1+ in tree, 5/26: canopy pond apple, 6/1: pulled" +2022,vacation,209,greg,2022-04-06,2,,incubating,"4/13: chick very wet, 5/13: sampled mercury, 5/19: 1+ in tree, 5/26: canopy pond apple, 6/1: pulled" +2022,vacation,209,greg,2022-04-13,1,1,wet_chick,"4/13: chick very wet, 5/13: sampled mercury, 5/19: 1+ in tree, 5/26: canopy pond apple, 6/1: pulled" +2022,vacation,209,greg,2022-04-20,,2,nestling,"4/13: chick very wet, 5/13: sampled mercury, 5/19: 1+ in tree, 5/26: canopy pond apple, 6/1: pulled" +2022,vacation,209,greg,2022-04-27,,2,nestling,"4/13: chick very wet, 5/13: sampled mercury, 5/19: 1+ in tree, 5/26: canopy pond apple, 6/1: pulled" +2022,vacation,209,greg,2022-05-04,,2,nestling,"4/13: chick very wet, 5/13: sampled mercury, 5/19: 1+ in tree, 5/26: canopy pond apple, 6/1: pulled" +2022,vacation,209,greg,2022-05-13,,2,nestling,"4/13: chick very wet, 5/13: sampled mercury, 5/19: 1+ in tree, 5/26: canopy pond apple, 6/1: pulled" +2022,vacation,209,greg,2022-05-19,,1,branchling,"4/13: chick very wet, 5/13: sampled mercury, 5/19: 1+ in tree, 5/26: canopy pond apple, 6/1: pulled" +2022,vacation,209,greg,2022-05-26,,,empty,"4/13: chick very wet, 5/13: sampled mercury, 5/19: 1+ in tree, 5/26: canopy pond apple, 6/1: pulled" +2022,vacation,209,greg,2022-06-01,,,empty,"4/13: chick very wet, 5/13: sampled mercury, 5/19: 1+ in tree, 5/26: canopy pond apple, 6/1: pulled" +2022,vacation,209,greg,2022-06-09,,,,"4/13: chick very wet, 5/13: sampled mercury, 5/19: 1+ in tree, 5/26: canopy pond apple, 6/1: pulled" +2022,vacation,321,greg,2022-03-02,,,,"4/13: chick just hatched/wet?, 5/19: chicks in tree, 5/26: canopy pond apple, 1C+, 6/1: pulled" +2022,vacation,321,greg,2022-03-08,,,,"4/13: chick just hatched/wet?, 5/19: chicks in tree, 5/26: canopy pond apple, 1C+, 6/1: pulled" +2022,vacation,321,greg,2022-03-15,,,,"4/13: chick just hatched/wet?, 5/19: chicks in tree, 5/26: canopy pond apple, 1C+, 6/1: pulled" +2022,vacation,321,greg,2022-03-22,2,,incubating,"4/13: chick just hatched/wet?, 5/19: chicks in tree, 5/26: canopy pond apple, 1C+, 6/1: pulled" +2022,vacation,321,greg,2022-03-30,2,,incubating,"4/13: chick just hatched/wet?, 5/19: chicks in tree, 5/26: canopy pond apple, 1C+, 6/1: pulled" +2022,vacation,321,greg,2022-04-06,2,,incubating,"4/13: chick just hatched/wet?, 5/19: chicks in tree, 5/26: canopy pond apple, 1C+, 6/1: pulled" +2022,vacation,321,greg,2022-04-13,1,1,wet_chick,"4/13: chick just hatched/wet?, 5/19: chicks in tree, 5/26: canopy pond apple, 1C+, 6/1: pulled" +2022,vacation,321,greg,2022-04-20,,2,nestling,"4/13: chick just hatched/wet?, 5/19: chicks in tree, 5/26: canopy pond apple, 1C+, 6/1: pulled" +2022,vacation,321,greg,2022-04-27,,2,nestling,"4/13: chick just hatched/wet?, 5/19: chicks in tree, 5/26: canopy pond apple, 1C+, 6/1: pulled" +2022,vacation,321,greg,2022-05-04,,,missed,"4/13: chick just hatched/wet?, 5/19: chicks in tree, 5/26: canopy pond apple, 1C+, 6/1: pulled" +2022,vacation,321,greg,2022-05-13,,2,nestling,"4/13: chick just hatched/wet?, 5/19: chicks in tree, 5/26: canopy pond apple, 1C+, 6/1: pulled" +2022,vacation,321,greg,2022-05-19,,2,branchling,"4/13: chick just hatched/wet?, 5/19: chicks in tree, 5/26: canopy pond apple, 1C+, 6/1: pulled" +2022,vacation,321,greg,2022-05-26,,1,branchling,"4/13: chick just hatched/wet?, 5/19: chicks in tree, 5/26: canopy pond apple, 1C+, 6/1: pulled" +2022,vacation,321,greg,2022-06-01,,,empty,"4/13: chick just hatched/wet?, 5/19: chicks in tree, 5/26: canopy pond apple, 1C+, 6/1: pulled" +2022,vacation,321,greg,2022-06-09,,,,"4/13: chick just hatched/wet?, 5/19: chicks in tree, 5/26: canopy pond apple, 1C+, 6/1: pulled" +2022,vacation,420,greg,2022-03-02,,,,"Flag 5ft in front of nest. 4/13: nest marked as gone but chicks present on 4/20, 5/4: 2 branchlings nearby, 5/19: gone, 5/26: gone, 6/1: pulled" +2022,vacation,420,greg,2022-03-08,,,,"Flag 5ft in front of nest. 4/13: nest marked as gone but chicks present on 4/20, 5/4: 2 branchlings nearby, 5/19: gone, 5/26: gone, 6/1: pulled" +2022,vacation,420,greg,2022-03-15,,,,"Flag 5ft in front of nest. 4/13: nest marked as gone but chicks present on 4/20, 5/4: 2 branchlings nearby, 5/19: gone, 5/26: gone, 6/1: pulled" +2022,vacation,420,greg,2022-03-22,,,,"Flag 5ft in front of nest. 4/13: nest marked as gone but chicks present on 4/20, 5/4: 2 branchlings nearby, 5/19: gone, 5/26: gone, 6/1: pulled" +2022,vacation,420,greg,2022-03-30,3,,incubating,"Flag 5ft in front of nest. 4/13: nest marked as gone but chicks present on 4/20, 5/4: 2 branchlings nearby, 5/19: gone, 5/26: gone, 6/1: pulled" +2022,vacation,420,greg,2022-04-06,1,,incubating,"Flag 5ft in front of nest. 4/13: nest marked as gone but chicks present on 4/20, 5/4: 2 branchlings nearby, 5/19: gone, 5/26: gone, 6/1: pulled" +2022,vacation,420,greg,2022-04-13,,,collapsed,"Flag 5ft in front of nest. 4/13: nest marked as gone but chicks present on 4/20, 5/4: 2 branchlings nearby, 5/19: gone, 5/26: gone, 6/1: pulled" +2022,vacation,420,greg,2022-04-20,,2,nestling,"Flag 5ft in front of nest. 4/13: nest marked as gone but chicks present on 4/20, 5/4: 2 branchlings nearby, 5/19: gone, 5/26: gone, 6/1: pulled" +2022,vacation,420,greg,2022-04-27,,2,nestling,"Flag 5ft in front of nest. 4/13: nest marked as gone but chicks present on 4/20, 5/4: 2 branchlings nearby, 5/19: gone, 5/26: gone, 6/1: pulled" +2022,vacation,420,greg,2022-05-04,,,empty,"Flag 5ft in front of nest. 4/13: nest marked as gone but chicks present on 4/20, 5/4: 2 branchlings nearby, 5/19: gone, 5/26: gone, 6/1: pulled" +2022,vacation,420,greg,2022-05-13,,,empty,"Flag 5ft in front of nest. 4/13: nest marked as gone but chicks present on 4/20, 5/4: 2 branchlings nearby, 5/19: gone, 5/26: gone, 6/1: pulled" +2022,vacation,420,greg,2022-05-19,,,collapsed,"Flag 5ft in front of nest. 4/13: nest marked as gone but chicks present on 4/20, 5/4: 2 branchlings nearby, 5/19: gone, 5/26: gone, 6/1: pulled" +2022,vacation,420,greg,2022-05-26,,,collapsed,"Flag 5ft in front of nest. 4/13: nest marked as gone but chicks present on 4/20, 5/4: 2 branchlings nearby, 5/19: gone, 5/26: gone, 6/1: pulled" +2022,vacation,420,greg,2022-06-01,,,,"Flag 5ft in front of nest. 4/13: nest marked as gone but chicks present on 4/20, 5/4: 2 branchlings nearby, 5/19: gone, 5/26: gone, 6/1: pulled" +2022,vacation,420,greg,2022-06-09,,,,"Flag 5ft in front of nest. 4/13: nest marked as gone but chicks present on 4/20, 5/4: 2 branchlings nearby, 5/19: gone, 5/26: gone, 6/1: pulled" +2022,vacation,375,greg,2022-03-02,,,,"4/27: chicks dry, 6/1: chicks in canopy" +2022,vacation,375,greg,2022-03-08,,,,"4/27: chicks dry, 6/1: chicks in canopy" +2022,vacation,375,greg,2022-03-15,,,,"4/27: chicks dry, 6/1: chicks in canopy" +2022,vacation,375,greg,2022-03-22,,,,"4/27: chicks dry, 6/1: chicks in canopy" +2022,vacation,375,greg,2022-03-30,2,,incubating,"4/27: chicks dry, 6/1: chicks in canopy" +2022,vacation,375,greg,2022-04-06,2,,incubating,"4/27: chicks dry, 6/1: chicks in canopy" +2022,vacation,375,greg,2022-04-13,2,,incubating,"4/27: chicks dry, 6/1: chicks in canopy" +2022,vacation,375,greg,2022-04-20,2,,incubating,"4/27: chicks dry, 6/1: chicks in canopy" +2022,vacation,375,greg,2022-04-27,,2,chick_dry,"4/27: chicks dry, 6/1: chicks in canopy" +2022,vacation,375,greg,2022-05-04,,2,nestling,"4/27: chicks dry, 6/1: chicks in canopy" +2022,vacation,375,greg,2022-05-13,,2,nestling,"4/27: chicks dry, 6/1: chicks in canopy" +2022,vacation,375,greg,2022-05-19,,2,nestling,"4/27: chicks dry, 6/1: chicks in canopy" +2022,vacation,375,greg,2022-05-26,,2,nestling,"4/27: chicks dry, 6/1: chicks in canopy" +2022,vacation,375,greg,2022-06-01,,2,branchling,"4/27: chicks dry, 6/1: chicks in canopy" +2022,vacation,375,greg,2022-06-09,,,empty,"4/27: chicks dry, 6/1: chicks in canopy" +2022,vacation,377,greg,2022-03-02,,,,"4/27: chicks dry, 5/19: 2c only, 6/1: chicks can't fly yet, 6/9: 1+c in tree top" +2022,vacation,377,greg,2022-03-08,,,,"4/27: chicks dry, 5/19: 2c only, 6/1: chicks can't fly yet, 6/9: 1+c in tree top" +2022,vacation,377,greg,2022-03-15,,,,"4/27: chicks dry, 5/19: 2c only, 6/1: chicks can't fly yet, 6/9: 1+c in tree top" +2022,vacation,377,greg,2022-03-22,,,,"4/27: chicks dry, 5/19: 2c only, 6/1: chicks can't fly yet, 6/9: 1+c in tree top" +2022,vacation,377,greg,2022-03-30,1,,incubating,"4/27: chicks dry, 5/19: 2c only, 6/1: chicks can't fly yet, 6/9: 1+c in tree top" +2022,vacation,377,greg,2022-04-06,3,,incubating,"4/27: chicks dry, 5/19: 2c only, 6/1: chicks can't fly yet, 6/9: 1+c in tree top" +2022,vacation,377,greg,2022-04-13,3,,incubating,"4/27: chicks dry, 5/19: 2c only, 6/1: chicks can't fly yet, 6/9: 1+c in tree top" +2022,vacation,377,greg,2022-04-20,3,,incubating,"4/27: chicks dry, 5/19: 2c only, 6/1: chicks can't fly yet, 6/9: 1+c in tree top" +2022,vacation,377,greg,2022-04-27,1,2,chick_dry,"4/27: chicks dry, 5/19: 2c only, 6/1: chicks can't fly yet, 6/9: 1+c in tree top" +2022,vacation,377,greg,2022-05-04,,3,nestling,"4/27: chicks dry, 5/19: 2c only, 6/1: chicks can't fly yet, 6/9: 1+c in tree top" +2022,vacation,377,greg,2022-05-13,,3,nestling,"4/27: chicks dry, 5/19: 2c only, 6/1: chicks can't fly yet, 6/9: 1+c in tree top" +2022,vacation,377,greg,2022-05-19,,2,nestling,"4/27: chicks dry, 5/19: 2c only, 6/1: chicks can't fly yet, 6/9: 1+c in tree top" +2022,vacation,377,greg,2022-05-26,,2,nestling,"4/27: chicks dry, 5/19: 2c only, 6/1: chicks can't fly yet, 6/9: 1+c in tree top" +2022,vacation,377,greg,2022-06-01,,2,nestling,"4/27: chicks dry, 5/19: 2c only, 6/1: chicks can't fly yet, 6/9: 1+c in tree top" +2022,vacation,377,greg,2022-06-09,,1,branchling,"4/27: chicks dry, 5/19: 2c only, 6/1: chicks can't fly yet, 6/9: 1+c in tree top" +2022,vacation,424,greg,2022-03-02,,,,"Near 76. 4/27: 1E pipping, 5/13: under GBHE, 5/26: maybe 1C in tree?, 6/1: maybe 1c in tree?" +2022,vacation,424,greg,2022-03-08,,,,"Near 76. 4/27: 1E pipping, 5/13: under GBHE, 5/26: maybe 1C in tree?, 6/1: maybe 1c in tree?" +2022,vacation,424,greg,2022-03-15,,,,"Near 76. 4/27: 1E pipping, 5/13: under GBHE, 5/26: maybe 1C in tree?, 6/1: maybe 1c in tree?" +2022,vacation,424,greg,2022-03-22,,,,"Near 76. 4/27: 1E pipping, 5/13: under GBHE, 5/26: maybe 1C in tree?, 6/1: maybe 1c in tree?" +2022,vacation,424,greg,2022-03-30,,,,"Near 76. 4/27: 1E pipping, 5/13: under GBHE, 5/26: maybe 1C in tree?, 6/1: maybe 1c in tree?" +2022,vacation,424,greg,2022-04-06,3,,incubating,"Near 76. 4/27: 1E pipping, 5/13: under GBHE, 5/26: maybe 1C in tree?, 6/1: maybe 1c in tree?" +2022,vacation,424,greg,2022-04-13,3,,incubating,"Near 76. 4/27: 1E pipping, 5/13: under GBHE, 5/26: maybe 1C in tree?, 6/1: maybe 1c in tree?" +2022,vacation,424,greg,2022-04-20,3,,incubating,"Near 76. 4/27: 1E pipping, 5/13: under GBHE, 5/26: maybe 1C in tree?, 6/1: maybe 1c in tree?" +2022,vacation,424,greg,2022-04-27,1,2,hatching,"Near 76. 4/27: 1E pipping, 5/13: under GBHE, 5/26: maybe 1C in tree?, 6/1: maybe 1c in tree?" +2022,vacation,424,greg,2022-05-04,,3,nestling,"Near 76. 4/27: 1E pipping, 5/13: under GBHE, 5/26: maybe 1C in tree?, 6/1: maybe 1c in tree?" +2022,vacation,424,greg,2022-05-13,,3,nestling,"Near 76. 4/27: 1E pipping, 5/13: under GBHE, 5/26: maybe 1C in tree?, 6/1: maybe 1c in tree?" +2022,vacation,424,greg,2022-05-19,,3,nestling,"Near 76. 4/27: 1E pipping, 5/13: under GBHE, 5/26: maybe 1C in tree?, 6/1: maybe 1c in tree?" +2022,vacation,424,greg,2022-05-26,,,empty,"Near 76. 4/27: 1E pipping, 5/13: under GBHE, 5/26: maybe 1C in tree?, 6/1: maybe 1c in tree?" +2022,vacation,424,greg,2022-06-01,,,empty,"Near 76. 4/27: 1E pipping, 5/13: under GBHE, 5/26: maybe 1C in tree?, 6/1: maybe 1c in tree?" +2022,vacation,424,greg,2022-06-09,,,empty,"Near 76. 4/27: 1E pipping, 5/13: under GBHE, 5/26: maybe 1C in tree?, 6/1: maybe 1c in tree?" +2022,vacation,426,greg,2022-03-02,,,,"Near 66 and 129. 4/27: 1C wet 1C dry, 5/26: canopy pond apple, 6/1: chicks can't fly yet, 1 additional dead chick on ground, pulled" +2022,vacation,426,greg,2022-03-08,,,,"Near 66 and 129. 4/27: 1C wet 1C dry, 5/26: canopy pond apple, 6/1: chicks can't fly yet, 1 additional dead chick on ground, pulled" +2022,vacation,426,greg,2022-03-15,,,,"Near 66 and 129. 4/27: 1C wet 1C dry, 5/26: canopy pond apple, 6/1: chicks can't fly yet, 1 additional dead chick on ground, pulled" +2022,vacation,426,greg,2022-03-22,,,,"Near 66 and 129. 4/27: 1C wet 1C dry, 5/26: canopy pond apple, 6/1: chicks can't fly yet, 1 additional dead chick on ground, pulled" +2022,vacation,426,greg,2022-03-30,,,,"Near 66 and 129. 4/27: 1C wet 1C dry, 5/26: canopy pond apple, 6/1: chicks can't fly yet, 1 additional dead chick on ground, pulled" +2022,vacation,426,greg,2022-04-06,3,,incubating,"Near 66 and 129. 4/27: 1C wet 1C dry, 5/26: canopy pond apple, 6/1: chicks can't fly yet, 1 additional dead chick on ground, pulled" +2022,vacation,426,greg,2022-04-13,3,,incubating,"Near 66 and 129. 4/27: 1C wet 1C dry, 5/26: canopy pond apple, 6/1: chicks can't fly yet, 1 additional dead chick on ground, pulled" +2022,vacation,426,greg,2022-04-20,3,,incubating,"Near 66 and 129. 4/27: 1C wet 1C dry, 5/26: canopy pond apple, 6/1: chicks can't fly yet, 1 additional dead chick on ground, pulled" +2022,vacation,426,greg,2022-04-27,1,2,wet_chick,"Near 66 and 129. 4/27: 1C wet 1C dry, 5/26: canopy pond apple, 6/1: chicks can't fly yet, 1 additional dead chick on ground, pulled" +2022,vacation,426,greg,2022-05-04,,3,nestling,"Near 66 and 129. 4/27: 1C wet 1C dry, 5/26: canopy pond apple, 6/1: chicks can't fly yet, 1 additional dead chick on ground, pulled" +2022,vacation,426,greg,2022-05-13,,3,nestling,"Near 66 and 129. 4/27: 1C wet 1C dry, 5/26: canopy pond apple, 6/1: chicks can't fly yet, 1 additional dead chick on ground, pulled" +2022,vacation,426,greg,2022-05-19,,3,nestling,"Near 66 and 129. 4/27: 1C wet 1C dry, 5/26: canopy pond apple, 6/1: chicks can't fly yet, 1 additional dead chick on ground, pulled" +2022,vacation,426,greg,2022-05-26,,3,nestling,"Near 66 and 129. 4/27: 1C wet 1C dry, 5/26: canopy pond apple, 6/1: chicks can't fly yet, 1 additional dead chick on ground, pulled" +2022,vacation,426,greg,2022-06-01,,2,nestling,"Near 66 and 129. 4/27: 1C wet 1C dry, 5/26: canopy pond apple, 6/1: chicks can't fly yet, 1 additional dead chick on ground, pulled" +2022,vacation,426,greg,2022-06-09,,,,"Near 66 and 129. 4/27: 1C wet 1C dry, 5/26: canopy pond apple, 6/1: chicks can't fly yet, 1 additional dead chick on ground, pulled" +2022,vacation,428,greg,2022-03-02,,,,"Before 70. 5/13: orange paper in nest#5, 5/19: gone, 5/26: gone, 6/1: pulled" +2022,vacation,428,greg,2022-03-08,,,,"Before 70. 5/13: orange paper in nest#5, 5/19: gone, 5/26: gone, 6/1: pulled" +2022,vacation,428,greg,2022-03-15,,,,"Before 70. 5/13: orange paper in nest#5, 5/19: gone, 5/26: gone, 6/1: pulled" +2022,vacation,428,greg,2022-03-22,,,,"Before 70. 5/13: orange paper in nest#5, 5/19: gone, 5/26: gone, 6/1: pulled" +2022,vacation,428,greg,2022-03-30,,,,"Before 70. 5/13: orange paper in nest#5, 5/19: gone, 5/26: gone, 6/1: pulled" +2022,vacation,428,greg,2022-04-06,1,,incubating,"Before 70. 5/13: orange paper in nest#5, 5/19: gone, 5/26: gone, 6/1: pulled" +2022,vacation,428,greg,2022-04-13,2,,incubating,"Before 70. 5/13: orange paper in nest#5, 5/19: gone, 5/26: gone, 6/1: pulled" +2022,vacation,428,greg,2022-04-20,2,,incubating,"Before 70. 5/13: orange paper in nest#5, 5/19: gone, 5/26: gone, 6/1: pulled" +2022,vacation,428,greg,2022-04-27,,,empty,"Before 70. 5/13: orange paper in nest#5, 5/19: gone, 5/26: gone, 6/1: pulled" +2022,vacation,428,greg,2022-05-04,,,empty,"Before 70. 5/13: orange paper in nest#5, 5/19: gone, 5/26: gone, 6/1: pulled" +2022,vacation,428,greg,2022-05-13,,,empty,"Before 70. 5/13: orange paper in nest#5, 5/19: gone, 5/26: gone, 6/1: pulled" +2022,vacation,428,greg,2022-05-19,,,collapsed,"Before 70. 5/13: orange paper in nest#5, 5/19: gone, 5/26: gone, 6/1: pulled" +2022,vacation,428,greg,2022-05-26,,,collapsed,"Before 70. 5/13: orange paper in nest#5, 5/19: gone, 5/26: gone, 6/1: pulled" +2022,vacation,428,greg,2022-06-01,,,,"Before 70. 5/13: orange paper in nest#5, 5/19: gone, 5/26: gone, 6/1: pulled" +2022,vacation,428,greg,2022-06-09,,,,"Before 70. 5/13: orange paper in nest#5, 5/19: gone, 5/26: gone, 6/1: pulled" +2022,vacation,430,greg,2022-03-02,,,,"Off transect to the right near 428. 4/13: chick dry, 5/13: mercury sampled, 5/26: 2+ fledgling, 6/1: pulled" +2022,vacation,430,greg,2022-03-08,,,,"Off transect to the right near 428. 4/13: chick dry, 5/13: mercury sampled, 5/26: 2+ fledgling, 6/1: pulled" +2022,vacation,430,greg,2022-03-15,,,,"Off transect to the right near 428. 4/13: chick dry, 5/13: mercury sampled, 5/26: 2+ fledgling, 6/1: pulled" +2022,vacation,430,greg,2022-03-22,,,,"Off transect to the right near 428. 4/13: chick dry, 5/13: mercury sampled, 5/26: 2+ fledgling, 6/1: pulled" +2022,vacation,430,greg,2022-03-30,,,,"Off transect to the right near 428. 4/13: chick dry, 5/13: mercury sampled, 5/26: 2+ fledgling, 6/1: pulled" +2022,vacation,430,greg,2022-04-06,4,,incubating,"Off transect to the right near 428. 4/13: chick dry, 5/13: mercury sampled, 5/26: 2+ fledgling, 6/1: pulled" +2022,vacation,430,greg,2022-04-13,1,2,hatching,"Off transect to the right near 428. 4/13: chick dry, 5/13: mercury sampled, 5/26: 2+ fledgling, 6/1: pulled" +2022,vacation,430,greg,2022-04-20,,4,nestling,"Off transect to the right near 428. 4/13: chick dry, 5/13: mercury sampled, 5/26: 2+ fledgling, 6/1: pulled" +2022,vacation,430,greg,2022-04-27,,4,nestling,"Off transect to the right near 428. 4/13: chick dry, 5/13: mercury sampled, 5/26: 2+ fledgling, 6/1: pulled" +2022,vacation,430,greg,2022-05-04,,3,nestling,"Off transect to the right near 428. 4/13: chick dry, 5/13: mercury sampled, 5/26: 2+ fledgling, 6/1: pulled" +2022,vacation,430,greg,2022-05-13,,3,nestling,"Off transect to the right near 428. 4/13: chick dry, 5/13: mercury sampled, 5/26: 2+ fledgling, 6/1: pulled" +2022,vacation,430,greg,2022-05-19,,3,nestling,"Off transect to the right near 428. 4/13: chick dry, 5/13: mercury sampled, 5/26: 2+ fledgling, 6/1: pulled" +2022,vacation,430,greg,2022-05-26,,,empty,"Off transect to the right near 428. 4/13: chick dry, 5/13: mercury sampled, 5/26: 2+ fledgling, 6/1: pulled" +2022,vacation,430,greg,2022-06-01,,,,"Off transect to the right near 428. 4/13: chick dry, 5/13: mercury sampled, 5/26: 2+ fledgling, 6/1: pulled" +2022,vacation,430,greg,2022-06-09,,,,"Off transect to the right near 428. 4/13: chick dry, 5/13: mercury sampled, 5/26: 2+ fledgling, 6/1: pulled" +2022,vacation,432,greg,2022-03-02,,,,"Off transect to the right near 428. 4/13: chick dry, 5/26: beside 430, lower, smaller, 6/1: pulled" +2022,vacation,432,greg,2022-03-08,,,,"Off transect to the right near 428. 4/13: chick dry, 5/26: beside 430, lower, smaller, 6/1: pulled" +2022,vacation,432,greg,2022-03-15,,,,"Off transect to the right near 428. 4/13: chick dry, 5/26: beside 430, lower, smaller, 6/1: pulled" +2022,vacation,432,greg,2022-03-22,,,,"Off transect to the right near 428. 4/13: chick dry, 5/26: beside 430, lower, smaller, 6/1: pulled" +2022,vacation,432,greg,2022-03-30,,,,"Off transect to the right near 428. 4/13: chick dry, 5/26: beside 430, lower, smaller, 6/1: pulled" +2022,vacation,432,greg,2022-04-06,3,,incubating,"Off transect to the right near 428. 4/13: chick dry, 5/26: beside 430, lower, smaller, 6/1: pulled" +2022,vacation,432,greg,2022-04-13,3,,incubating,"Off transect to the right near 428. 4/13: chick dry, 5/26: beside 430, lower, smaller, 6/1: pulled" +2022,vacation,432,greg,2022-04-20,3,,incubating,"Off transect to the right near 428. 4/13: chick dry, 5/26: beside 430, lower, smaller, 6/1: pulled" +2022,vacation,432,greg,2022-04-27,3,,incubating,"Off transect to the right near 428. 4/13: chick dry, 5/26: beside 430, lower, smaller, 6/1: pulled" +2022,vacation,432,greg,2022-05-04,1,2,chick_dry,"Off transect to the right near 428. 4/13: chick dry, 5/26: beside 430, lower, smaller, 6/1: pulled" +2022,vacation,432,greg,2022-05-13,,2,nestling,"Off transect to the right near 428. 4/13: chick dry, 5/26: beside 430, lower, smaller, 6/1: pulled" +2022,vacation,432,greg,2022-05-19,,2,nestling,"Off transect to the right near 428. 4/13: chick dry, 5/26: beside 430, lower, smaller, 6/1: pulled" +2022,vacation,432,greg,2022-05-26,,2,nestling,"Off transect to the right near 428. 4/13: chick dry, 5/26: beside 430, lower, smaller, 6/1: pulled" +2022,vacation,432,greg,2022-06-01,,,empty,"Off transect to the right near 428. 4/13: chick dry, 5/26: beside 430, lower, smaller, 6/1: pulled" +2022,vacation,432,greg,2022-06-09,,,,"Off transect to the right near 428. 4/13: chick dry, 5/26: beside 430, lower, smaller, 6/1: pulled" +2022,vacation,434,greg,2022-03-02,,,,"Next to 420. 5/26: chicks running away" +2022,vacation,434,greg,2022-03-08,,,,"Next to 420. 5/26: chicks running away" +2022,vacation,434,greg,2022-03-15,,,,"Next to 420. 5/26: chicks running away" +2022,vacation,434,greg,2022-03-22,,,,"Next to 420. 5/26: chicks running away" +2022,vacation,434,greg,2022-03-30,,,,"Next to 420. 5/26: chicks running away" +2022,vacation,434,greg,2022-04-06,3,,incubating,"Next to 420. 5/26: chicks running away" +2022,vacation,434,greg,2022-04-13,3,,incubating,"Next to 420. 5/26: chicks running away" +2022,vacation,434,greg,2022-04-20,3,,incubating,"Next to 420. 5/26: chicks running away" +2022,vacation,434,greg,2022-04-27,,3,nestling,"Next to 420. 5/26: chicks running away" +2022,vacation,434,greg,2022-05-04,,3,nestling,"Next to 420. 5/26: chicks running away" +2022,vacation,434,greg,2022-05-13,,3,nestling,"Next to 420. 5/26: chicks running away" +2022,vacation,434,greg,2022-05-19,,3,nestling,"Next to 420. 5/26: chicks running away" +2022,vacation,434,greg,2022-05-26,,2,nestling,"Next to 420. 5/26: chicks running away" +2022,vacation,434,greg,2022-06-01,,,empty,"Next to 420. 5/26: chicks running away" +2022,vacation,434,greg,2022-06-09,,,,"Next to 420. 5/26: chicks running away" +2022,vacation,436,greg,2022-03-02,,,,"Behind 198. 4/27: E pipping, C dry, 5/13: yellow to north #7, 6/1: pulled" +2022,vacation,436,greg,2022-03-08,,,,"Behind 198. 4/27: E pipping, C dry, 5/13: yellow to north #7, 6/1: pulled" +2022,vacation,436,greg,2022-03-15,,,,"Behind 198. 4/27: E pipping, C dry, 5/13: yellow to north #7, 6/1: pulled" +2022,vacation,436,greg,2022-03-22,,,,"Behind 198. 4/27: E pipping, C dry, 5/13: yellow to north #7, 6/1: pulled" +2022,vacation,436,greg,2022-03-30,,,,"Behind 198. 4/27: E pipping, C dry, 5/13: yellow to north #7, 6/1: pulled" +2022,vacation,436,greg,2022-04-06,3,,incubating,"Behind 198. 4/27: E pipping, C dry, 5/13: yellow to north #7, 6/1: pulled" +2022,vacation,436,greg,2022-04-13,3,,incubating,"Behind 198. 4/27: E pipping, C dry, 5/13: yellow to north #7, 6/1: pulled" +2022,vacation,436,greg,2022-04-20,3,,incubating,"Behind 198. 4/27: E pipping, C dry, 5/13: yellow to north #7, 6/1: pulled" +2022,vacation,436,greg,2022-04-27,1,2,hatching,"Behind 198. 4/27: E pipping, C dry, 5/13: yellow to north #7, 6/1: pulled" +2022,vacation,436,greg,2022-05-04,,3,nestling,"Behind 198. 4/27: E pipping, C dry, 5/13: yellow to north #7, 6/1: pulled" +2022,vacation,436,greg,2022-05-13,,3,nestling,"Behind 198. 4/27: E pipping, C dry, 5/13: yellow to north #7, 6/1: pulled" +2022,vacation,436,greg,2022-05-19,,2,nestling,"Behind 198. 4/27: E pipping, C dry, 5/13: yellow to north #7, 6/1: pulled" +2022,vacation,436,greg,2022-05-26,,,empty,"Behind 198. 4/27: E pipping, C dry, 5/13: yellow to north #7, 6/1: pulled" +2022,vacation,436,greg,2022-06-01,,,empty,"Behind 198. 4/27: E pipping, C dry, 5/13: yellow to north #7, 6/1: pulled" +2022,vacation,436,greg,2022-06-09,,,,"Behind 198. 4/27: E pipping, C dry, 5/13: yellow to north #7, 6/1: pulled" +2022,vacation,438,greg,2022-03-02,,,,"Next to 436. 5/4: chicks dry" +2022,vacation,438,greg,2022-03-08,,,,"Next to 436. 5/4: chicks dry" +2022,vacation,438,greg,2022-03-15,,,,"Next to 436. 5/4: chicks dry" +2022,vacation,438,greg,2022-03-22,,,,"Next to 436. 5/4: chicks dry" +2022,vacation,438,greg,2022-03-30,,,,"Next to 436. 5/4: chicks dry" +2022,vacation,438,greg,2022-04-06,3,,incubating,"Next to 436. 5/4: chicks dry" +2022,vacation,438,greg,2022-04-13,3,,incubating,"Next to 436. 5/4: chicks dry" +2022,vacation,438,greg,2022-04-20,3,,incubating,"Next to 436. 5/4: chicks dry" +2022,vacation,438,greg,2022-04-27,2,,incubating,"Next to 436. 5/4: chicks dry" +2022,vacation,438,greg,2022-05-04,1,1,chick_dry,"Next to 436. 5/4: chicks dry" +2022,vacation,438,greg,2022-05-13,1,1,hatching,"Next to 436. 5/4: chicks dry" +2022,vacation,438,greg,2022-05-19,,1,nestling,"Next to 436. 5/4: chicks dry" +2022,vacation,438,greg,2022-05-26,,1,nestling,"Next to 436. 5/4: chicks dry" +2022,vacation,438,greg,2022-06-01,,1,nestling,"Next to 436. 5/4: chicks dry" +2022,vacation,438,greg,2022-06-09,,1,nestling,"Next to 436. 5/4: chicks dry" +2022,vacation,440,greg,2022-03-02,,,,"After 203. 4/20: pink paper on the edge of nest, 4/27: paper removed, 5/19: blue in nest, 6/1: pulled" +2022,vacation,440,greg,2022-03-08,,,,"After 203. 4/20: pink paper on the edge of nest, 4/27: paper removed, 5/19: blue in nest, 6/1: pulled" +2022,vacation,440,greg,2022-03-15,,,,"After 203. 4/20: pink paper on the edge of nest, 4/27: paper removed, 5/19: blue in nest, 6/1: pulled" +2022,vacation,440,greg,2022-03-22,,,,"After 203. 4/20: pink paper on the edge of nest, 4/27: paper removed, 5/19: blue in nest, 6/1: pulled" +2022,vacation,440,greg,2022-03-30,,,,"After 203. 4/20: pink paper on the edge of nest, 4/27: paper removed, 5/19: blue in nest, 6/1: pulled" +2022,vacation,440,greg,2022-04-06,2,,incubating,"After 203. 4/20: pink paper on the edge of nest, 4/27: paper removed, 5/19: blue in nest, 6/1: pulled" +2022,vacation,440,greg,2022-04-13,2,,incubating,"After 203. 4/20: pink paper on the edge of nest, 4/27: paper removed, 5/19: blue in nest, 6/1: pulled" +2022,vacation,440,greg,2022-04-20,2,,incubating,"After 203. 4/20: pink paper on the edge of nest, 4/27: paper removed, 5/19: blue in nest, 6/1: pulled" +2022,vacation,440,greg,2022-04-27,,,empty,"After 203. 4/20: pink paper on the edge of nest, 4/27: paper removed, 5/19: blue in nest, 6/1: pulled" +2022,vacation,440,greg,2022-05-04,,,empty,"After 203. 4/20: pink paper on the edge of nest, 4/27: paper removed, 5/19: blue in nest, 6/1: pulled" +2022,vacation,440,greg,2022-05-13,,,empty,"After 203. 4/20: pink paper on the edge of nest, 4/27: paper removed, 5/19: blue in nest, 6/1: pulled" +2022,vacation,440,greg,2022-05-19,,,collapsed,"After 203. 4/20: pink paper on the edge of nest, 4/27: paper removed, 5/19: blue in nest, 6/1: pulled" +2022,vacation,440,greg,2022-05-26,,,empty,"After 203. 4/20: pink paper on the edge of nest, 4/27: paper removed, 5/19: blue in nest, 6/1: pulled" +2022,vacation,440,greg,2022-06-01,,,,"After 203. 4/20: pink paper on the edge of nest, 4/27: paper removed, 5/19: blue in nest, 6/1: pulled" +2022,vacation,440,greg,2022-06-09,,,,"After 203. 4/20: pink paper on the edge of nest, 4/27: paper removed, 5/19: blue in nest, 6/1: pulled" +2022,vacation,442,greg,2022-03-02,,,,"1st on trail. 4/13: chick dry, second pipping, 5/4: 1 branchling over this nest?? 5/13: yellow paper in nest #1, 5/19: blue flag in nest" +2022,vacation,442,greg,2022-03-08,,,,"1st on trail. 4/13: chick dry, second pipping, 5/4: 1 branchling over this nest?? 5/13: yellow paper in nest #1, 5/19: blue flag in nest" +2022,vacation,442,greg,2022-03-15,,,,"1st on trail. 4/13: chick dry, second pipping, 5/4: 1 branchling over this nest?? 5/13: yellow paper in nest #1, 5/19: blue flag in nest" +2022,vacation,442,greg,2022-03-22,,,,"1st on trail. 4/13: chick dry, second pipping, 5/4: 1 branchling over this nest?? 5/13: yellow paper in nest #1, 5/19: blue flag in nest" +2022,vacation,442,greg,2022-03-30,,,,"1st on trail. 4/13: chick dry, second pipping, 5/4: 1 branchling over this nest?? 5/13: yellow paper in nest #1, 5/19: blue flag in nest" +2022,vacation,442,greg,2022-04-06,3,,incubating,"1st on trail. 4/13: chick dry, second pipping, 5/4: 1 branchling over this nest?? 5/13: yellow paper in nest #1, 5/19: blue flag in nest" +2022,vacation,442,greg,2022-04-13,2,1,pipping,"1st on trail. 4/13: chick dry, second pipping, 5/4: 1 branchling over this nest?? 5/13: yellow paper in nest #1, 5/19: blue flag in nest" +2022,vacation,442,greg,2022-04-20,,3,nestling,"1st on trail. 4/13: chick dry, second pipping, 5/4: 1 branchling over this nest?? 5/13: yellow paper in nest #1, 5/19: blue flag in nest" +2022,vacation,442,greg,2022-04-27,,,empty,"1st on trail. 4/13: chick dry, second pipping, 5/4: 1 branchling over this nest?? 5/13: yellow paper in nest #1, 5/19: blue flag in nest" +2022,vacation,442,greg,2022-05-04,,,empty,"1st on trail. 4/13: chick dry, second pipping, 5/4: 1 branchling over this nest?? 5/13: yellow paper in nest #1, 5/19: blue flag in nest" +2022,vacation,442,greg,2022-05-13,,,empty,"1st on trail. 4/13: chick dry, second pipping, 5/4: 1 branchling over this nest?? 5/13: yellow paper in nest #1, 5/19: blue flag in nest" +2022,vacation,442,greg,2022-05-19,,,empty,"1st on trail. 4/13: chick dry, second pipping, 5/4: 1 branchling over this nest?? 5/13: yellow paper in nest #1, 5/19: blue flag in nest" +2022,vacation,442,greg,2022-05-26,,,empty,"1st on trail. 4/13: chick dry, second pipping, 5/4: 1 branchling over this nest?? 5/13: yellow paper in nest #1, 5/19: blue flag in nest" +2022,vacation,442,greg,2022-06-01,,,,"1st on trail. 4/13: chick dry, second pipping, 5/4: 1 branchling over this nest?? 5/13: yellow paper in nest #1, 5/19: blue flag in nest" +2022,vacation,442,greg,2022-06-09,,,,"1st on trail. 4/13: chick dry, second pipping, 5/4: 1 branchling over this nest?? 5/13: yellow paper in nest #1, 5/19: blue flag in nest" +2022,vacation,801,greg,2022-03-02,,,,"5/13: certain, 5/26: certain, 6/1: certain, 6/9: pile of feathers under nest" +2022,vacation,801,greg,2022-03-08,,,,"5/13: certain, 5/26: certain, 6/1: certain, 6/9: pile of feathers under nest" +2022,vacation,801,greg,2022-03-15,,,,"5/13: certain, 5/26: certain, 6/1: certain, 6/9: pile of feathers under nest" +2022,vacation,801,greg,2022-03-22,,,,"5/13: certain, 5/26: certain, 6/1: certain, 6/9: pile of feathers under nest" +2022,vacation,801,greg,2022-03-30,,,,"5/13: certain, 5/26: certain, 6/1: certain, 6/9: pile of feathers under nest" +2022,vacation,801,greg,2022-04-06,,,,"5/13: certain, 5/26: certain, 6/1: certain, 6/9: pile of feathers under nest" +2022,vacation,801,greg,2022-04-13,2,,incubating,"5/13: certain, 5/26: certain, 6/1: certain, 6/9: pile of feathers under nest" +2022,vacation,801,greg,2022-04-20,,,empty,"5/13: certain, 5/26: certain, 6/1: certain, 6/9: pile of feathers under nest" +2022,vacation,801,greg,2022-04-27,2,,incubating,"5/13: certain, 5/26: certain, 6/1: certain, 6/9: pile of feathers under nest" +2022,vacation,801,greg,2022-05-04,,1,nestling,"5/13: certain, 5/26: certain, 6/1: certain, 6/9: pile of feathers under nest" +2022,vacation,801,greg,2022-05-13,,2,nestling,"5/13: certain, 5/26: certain, 6/1: certain, 6/9: pile of feathers under nest" +2022,vacation,801,greg,2022-05-19,,1,nestling,"5/13: certain, 5/26: certain, 6/1: certain, 6/9: pile of feathers under nest" +2022,vacation,801,greg,2022-05-26,,2,nestling,"5/13: certain, 5/26: certain, 6/1: certain, 6/9: pile of feathers under nest" +2022,vacation,801,greg,2022-06-01,,2,nestling,"5/13: certain, 5/26: certain, 6/1: certain, 6/9: pile of feathers under nest" +2022,vacation,801,greg,2022-06-09,,,empty,"5/13: certain, 5/26: certain, 6/1: certain, 6/9: pile of feathers under nest" +2022,vacation,567,greg,2022-03-02,,,,"Flagged new on 4/27, but had originally been called nest 72 on 4/20 (neighbor nest, both still exist). Edited both by HC on 4/27. 5/26: right by 72, 6/9: 1 big chick in canopy--probably from this nest" +2022,vacation,567,greg,2022-03-08,,,,"Flagged new on 4/27, but had originally been called nest 72 on 4/20 (neighbor nest, both still exist). Edited both by HC on 4/27. 5/26: right by 72, 6/9: 1 big chick in canopy--probably from this nest" +2022,vacation,567,greg,2022-03-15,,,,"Flagged new on 4/27, but had originally been called nest 72 on 4/20 (neighbor nest, both still exist). Edited both by HC on 4/27. 5/26: right by 72, 6/9: 1 big chick in canopy--probably from this nest" +2022,vacation,567,greg,2022-03-22,,,,"Flagged new on 4/27, but had originally been called nest 72 on 4/20 (neighbor nest, both still exist). Edited both by HC on 4/27. 5/26: right by 72, 6/9: 1 big chick in canopy--probably from this nest" +2022,vacation,567,greg,2022-03-30,,,,"Flagged new on 4/27, but had originally been called nest 72 on 4/20 (neighbor nest, both still exist). Edited both by HC on 4/27. 5/26: right by 72, 6/9: 1 big chick in canopy--probably from this nest" +2022,vacation,567,greg,2022-04-06,,,,"Flagged new on 4/27, but had originally been called nest 72 on 4/20 (neighbor nest, both still exist). Edited both by HC on 4/27. 5/26: right by 72, 6/9: 1 big chick in canopy--probably from this nest" +2022,vacation,567,greg,2022-04-13,,,,"Flagged new on 4/27, but had originally been called nest 72 on 4/20 (neighbor nest, both still exist). Edited both by HC on 4/27. 5/26: right by 72, 6/9: 1 big chick in canopy--probably from this nest" +2022,vacation,567,greg,2022-04-20,2,,incubating,"Flagged new on 4/27, but had originally been called nest 72 on 4/20 (neighbor nest, both still exist). Edited both by HC on 4/27. 5/26: right by 72, 6/9: 1 big chick in canopy--probably from this nest" +2022,vacation,567,greg,2022-04-27,2,,incubating,"Flagged new on 4/27, but had originally been called nest 72 on 4/20 (neighbor nest, both still exist). Edited both by HC on 4/27. 5/26: right by 72, 6/9: 1 big chick in canopy--probably from this nest" +2022,vacation,567,greg,2022-05-04,2,,hatching,"Flagged new on 4/27, but had originally been called nest 72 on 4/20 (neighbor nest, both still exist). Edited both by HC on 4/27. 5/26: right by 72, 6/9: 1 big chick in canopy--probably from this nest" +2022,vacation,567,greg,2022-05-13,,2,nestling,"Flagged new on 4/27, but had originally been called nest 72 on 4/20 (neighbor nest, both still exist). Edited both by HC on 4/27. 5/26: right by 72, 6/9: 1 big chick in canopy--probably from this nest" +2022,vacation,567,greg,2022-05-19,,2,nestling,"Flagged new on 4/27, but had originally been called nest 72 on 4/20 (neighbor nest, both still exist). Edited both by HC on 4/27. 5/26: right by 72, 6/9: 1 big chick in canopy--probably from this nest" +2022,vacation,567,greg,2022-05-26,,2,nestling,"Flagged new on 4/27, but had originally been called nest 72 on 4/20 (neighbor nest, both still exist). Edited both by HC on 4/27. 5/26: right by 72, 6/9: 1 big chick in canopy--probably from this nest" +2022,vacation,567,greg,2022-06-01,,2,nestling,"Flagged new on 4/27, but had originally been called nest 72 on 4/20 (neighbor nest, both still exist). Edited both by HC on 4/27. 5/26: right by 72, 6/9: 1 big chick in canopy--probably from this nest" +2022,vacation,567,greg,2022-06-09,,,empty,"Flagged new on 4/27, but had originally been called nest 72 on 4/20 (neighbor nest, both still exist). Edited both by HC on 4/27. 5/26: right by 72, 6/9: 1 big chick in canopy--probably from this nest" +2023,vacation,47,greg,2023-02-20,1,,incubating,"2/20: nest E of trail 3/6: eggshell on ground below nest" +2023,vacation,47,greg,2023-02-27,1,,incubating,"2/20: nest E of trail 3/6: eggshell on ground below nest" +2023,vacation,47,greg,2023-03-06,,,empty,"2/20: nest E of trail 3/6: eggshell on ground below nest" +2023,vacation,47,greg,2023-03-13,,,,"2/20: nest E of trail 3/6: eggshell on ground below nest" +2023,vacation,47,greg,2023-03-20,,,,"2/20: nest E of trail 3/6: eggshell on ground below nest" +2023,vacation,47,greg,2023-03-27,,,,"2/20: nest E of trail 3/6: eggshell on ground below nest" +2023,vacation,47,greg,2023-04-03,,,,"2/20: nest E of trail 3/6: eggshell on ground below nest" +2023,vacation,47,greg,2023-04-13,,,,"2/20: nest E of trail 3/6: eggshell on ground below nest" +2023,vacation,47,greg,2023-04-18,,,,"2/20: nest E of trail 3/6: eggshell on ground below nest" +2023,vacation,47,greg,2023-04-24,,,,"2/20: nest E of trail 3/6: eggshell on ground below nest" +2023,vacation,47,greg,2023-05-01,,,,"2/20: nest E of trail 3/6: eggshell on ground below nest" +2023,vacation,47,greg,2023-05-08,,,,"2/20: nest E of trail 3/6: eggshell on ground below nest" +2023,vacation,90,greg,2023-02-20,1,,incubating,"4/13: chicks very small, yellow paper placed to the west 4/18: one chick in nest looks very weak; 5/1: Larger of the 2 chicks is possibly dead in nest; 5/8: Flag pulled" +2023,vacation,90,greg,2023-02-27,2,,incubating,"4/13: chicks very small, yellow paper placed to the west 4/18: one chick in nest looks very weak; 5/1: Larger of the 2 chicks is possibly dead in nest; 5/8: Flag pulled" +2023,vacation,90,greg,2023-03-06,2,,incubating,"4/13: chicks very small, yellow paper placed to the west 4/18: one chick in nest looks very weak; 5/1: Larger of the 2 chicks is possibly dead in nest; 5/8: Flag pulled" +2023,vacation,90,greg,2023-03-13,2,,incubating,"4/13: chicks very small, yellow paper placed to the west 4/18: one chick in nest looks very weak; 5/1: Larger of the 2 chicks is possibly dead in nest; 5/8: Flag pulled" +2023,vacation,90,greg,2023-03-20,,2,nestling,"4/13: chicks very small, yellow paper placed to the west 4/18: one chick in nest looks very weak; 5/1: Larger of the 2 chicks is possibly dead in nest; 5/8: Flag pulled" +2023,vacation,90,greg,2023-03-27,,2,nestling,"4/13: chicks very small, yellow paper placed to the west 4/18: one chick in nest looks very weak; 5/1: Larger of the 2 chicks is possibly dead in nest; 5/8: Flag pulled" +2023,vacation,90,greg,2023-04-03,,2,nestling,"4/13: chicks very small, yellow paper placed to the west 4/18: one chick in nest looks very weak; 5/1: Larger of the 2 chicks is possibly dead in nest; 5/8: Flag pulled" +2023,vacation,90,greg,2023-04-13,,2,nestling,"4/13: chicks very small, yellow paper placed to the west 4/18: one chick in nest looks very weak; 5/1: Larger of the 2 chicks is possibly dead in nest; 5/8: Flag pulled" +2023,vacation,90,greg,2023-04-18,,2,nestling,"4/13: chicks very small, yellow paper placed to the west 4/18: one chick in nest looks very weak; 5/1: Larger of the 2 chicks is possibly dead in nest; 5/8: Flag pulled" +2023,vacation,90,greg,2023-04-24,,1,nestling,"4/13: chicks very small, yellow paper placed to the west 4/18: one chick in nest looks very weak; 5/1: Larger of the 2 chicks is possibly dead in nest; 5/8: Flag pulled" +2023,vacation,90,greg,2023-05-01,,2,branchling,"4/13: chicks very small, yellow paper placed to the west 4/18: one chick in nest looks very weak; 5/1: Larger of the 2 chicks is possibly dead in nest; 5/8: Flag pulled" +2023,vacation,90,greg,2023-05-08,,1,branchling,"4/13: chicks very small, yellow paper placed to the west 4/18: one chick in nest looks very weak; 5/1: Larger of the 2 chicks is possibly dead in nest; 5/8: Flag pulled" +2023,vacation,92,greg,2023-02-20,2,,incubating,"3/13-chick dry, 4/13: parent still here" +2023,vacation,92,greg,2023-02-27,2,,incubating,"3/13-chick dry, 4/13: parent still here" +2023,vacation,92,greg,2023-03-06,2,,incubating,"3/13-chick dry, 4/13: parent still here" +2023,vacation,92,greg,2023-03-13,1,1,chick_dry,"3/13-chick dry, 4/13: parent still here" +2023,vacation,92,greg,2023-03-20,,1,nestling,"3/13-chick dry, 4/13: parent still here" +2023,vacation,92,greg,2023-03-27,,1,nestling,"3/13-chick dry, 4/13: parent still here" +2023,vacation,92,greg,2023-04-03,,1,nestling,"3/13-chick dry, 4/13: parent still here" +2023,vacation,92,greg,2023-04-13,,1,nestling,"3/13-chick dry, 4/13: parent still here" +2023,vacation,92,greg,2023-04-18,,1,nestling,"3/13-chick dry, 4/13: parent still here" +2023,vacation,92,greg,2023-04-24,,,empty,"3/13-chick dry, 4/13: parent still here" +2023,vacation,92,greg,2023-05-01,,,empty,"3/13-chick dry, 4/13: parent still here" +2023,vacation,92,greg,2023-05-08,,,pulled,"3/13-chick dry, 4/13: parent still here" +2023,vacation,78,greg,2023-02-20,2,,incubating,"3/20: eggshells on ground" +2023,vacation,78,greg,2023-02-27,2,,incubating,"3/20: eggshells on ground" +2023,vacation,78,greg,2023-03-06,2,,incubating,"3/20: eggshells on ground" +2023,vacation,78,greg,2023-03-13,2,,incubating,"3/20: eggshells on ground" +2023,vacation,78,greg,2023-03-20,,,empty,"3/20: eggshells on ground" +2023,vacation,78,greg,2023-03-27,,,,"3/20: eggshells on ground" +2023,vacation,78,greg,2023-04-03,,,,"3/20: eggshells on ground" +2023,vacation,78,greg,2023-04-13,,,,"3/20: eggshells on ground" +2023,vacation,78,greg,2023-04-18,,,,"3/20: eggshells on ground" +2023,vacation,78,greg,2023-04-24,,,,"3/20: eggshells on ground" +2023,vacation,78,greg,2023-05-01,,,,"3/20: eggshells on ground" +2023,vacation,78,greg,2023-05-08,,,,"3/20: eggshells on ground" +2023,vacation,214,greg,2023-02-20,,,,"4/3: to R of trail on the way in 4/13: one chick may be dead, orange paper to the east below nest 4/18: highly decomposed chick matter under nest" +2023,vacation,214,greg,2023-02-27,3,,incubating,"4/3: to R of trail on the way in 4/13: one chick may be dead, orange paper to the east below nest 4/18: highly decomposed chick matter under nest" +2023,vacation,214,greg,2023-03-06,3,,incubating,"4/3: to R of trail on the way in 4/13: one chick may be dead, orange paper to the east below nest 4/18: highly decomposed chick matter under nest" +2023,vacation,214,greg,2023-03-13,3,,incubating,"4/3: to R of trail on the way in 4/13: one chick may be dead, orange paper to the east below nest 4/18: highly decomposed chick matter under nest" +2023,vacation,214,greg,2023-03-20,3,,incubating,"4/3: to R of trail on the way in 4/13: one chick may be dead, orange paper to the east below nest 4/18: highly decomposed chick matter under nest" +2023,vacation,214,greg,2023-03-27,,3,nestling,"4/3: to R of trail on the way in 4/13: one chick may be dead, orange paper to the east below nest 4/18: highly decomposed chick matter under nest" +2023,vacation,214,greg,2023-04-03,,3,nestling,"4/3: to R of trail on the way in 4/13: one chick may be dead, orange paper to the east below nest 4/18: highly decomposed chick matter under nest" +2023,vacation,214,greg,2023-04-13,,2,nestling,"4/3: to R of trail on the way in 4/13: one chick may be dead, orange paper to the east below nest 4/18: highly decomposed chick matter under nest" +2023,vacation,214,greg,2023-04-18,,,empty,"4/3: to R of trail on the way in 4/13: one chick may be dead, orange paper to the east below nest 4/18: highly decomposed chick matter under nest" +2023,vacation,214,greg,2023-04-24,,,pulled,"4/3: to R of trail on the way in 4/13: one chick may be dead, orange paper to the east below nest 4/18: highly decomposed chick matter under nest" +2023,vacation,214,greg,2023-05-01,,,,"4/3: to R of trail on the way in 4/13: one chick may be dead, orange paper to the east below nest 4/18: highly decomposed chick matter under nest" +2023,vacation,214,greg,2023-05-08,,,,"4/3: to R of trail on the way in 4/13: one chick may be dead, orange paper to the east below nest 4/18: highly decomposed chick matter under nest" +2023,vacation,229,greg,2023-02-20,,,,"3/20: eggshells on ground 4/13: pink paper on vegetation to the west of nest, hard to see" +2023,vacation,229,greg,2023-02-27,2,,incubating,"3/20: eggshells on ground 4/13: pink paper on vegetation to the west of nest, hard to see" +2023,vacation,229,greg,2023-03-06,2,,incubating,"3/20: eggshells on ground 4/13: pink paper on vegetation to the west of nest, hard to see" +2023,vacation,229,greg,2023-03-13,2,,incubating,"3/20: eggshells on ground 4/13: pink paper on vegetation to the west of nest, hard to see" +2023,vacation,229,greg,2023-03-20,,,empty,"3/20: eggshells on ground 4/13: pink paper on vegetation to the west of nest, hard to see" +2023,vacation,229,greg,2023-03-27,,,,"3/20: eggshells on ground 4/13: pink paper on vegetation to the west of nest, hard to see" +2023,vacation,229,greg,2023-04-03,,,,"3/20: eggshells on ground 4/13: pink paper on vegetation to the west of nest, hard to see" +2023,vacation,229,greg,2023-04-13,,,,"3/20: eggshells on ground 4/13: pink paper on vegetation to the west of nest, hard to see" +2023,vacation,229,greg,2023-04-18,,,,"3/20: eggshells on ground 4/13: pink paper on vegetation to the west of nest, hard to see" +2023,vacation,229,greg,2023-04-24,,,,"3/20: eggshells on ground 4/13: pink paper on vegetation to the west of nest, hard to see" +2023,vacation,229,greg,2023-05-01,,,,"3/20: eggshells on ground 4/13: pink paper on vegetation to the west of nest, hard to see" +2023,vacation,229,greg,2023-05-08,,,,"3/20: eggshells on ground 4/13: pink paper on vegetation to the west of nest, hard to see" +2023,vacation,216,greg,2023-02-20,,,,"3/20: eggshells on ground 3/27 GREG re-lay; 4/3: eggshell on ground 4/13: blue paper in nest" +2023,vacation,216,greg,2023-02-27,2,,incubating,"3/20: eggshells on ground 3/27 GREG re-lay; 4/3: eggshell on ground 4/13: blue paper in nest" +2023,vacation,216,greg,2023-03-06,2,,incubating,"3/20: eggshells on ground 3/27 GREG re-lay; 4/3: eggshell on ground 4/13: blue paper in nest" +2023,vacation,216,greg,2023-03-13,2,,incubating,"3/20: eggshells on ground 3/27 GREG re-lay; 4/3: eggshell on ground 4/13: blue paper in nest" +2023,vacation,216,greg,2023-03-20,,,empty,"3/20: eggshells on ground 3/27 GREG re-lay; 4/3: eggshell on ground 4/13: blue paper in nest" +2023,vacation,216,greg,2023-03-27,2,,incubating,"3/20: eggshells on ground 3/27 GREG re-lay; 4/3: eggshell on ground 4/13: blue paper in nest" +2023,vacation,216,greg,2023-04-03,,,empty,"3/20: eggshells on ground 3/27 GREG re-lay; 4/3: eggshell on ground 4/13: blue paper in nest" +2023,vacation,216,greg,2023-04-13,,,,"3/20: eggshells on ground 3/27 GREG re-lay; 4/3: eggshell on ground 4/13: blue paper in nest" +2023,vacation,216,greg,2023-04-18,,,,"3/20: eggshells on ground 3/27 GREG re-lay; 4/3: eggshell on ground 4/13: blue paper in nest" +2023,vacation,216,greg,2023-04-24,,,,"3/20: eggshells on ground 3/27 GREG re-lay; 4/3: eggshell on ground 4/13: blue paper in nest" +2023,vacation,216,greg,2023-05-01,,,,"3/20: eggshells on ground 3/27 GREG re-lay; 4/3: eggshell on ground 4/13: blue paper in nest" +2023,vacation,216,greg,2023-05-08,,,,"3/20: eggshells on ground 3/27 GREG re-lay; 4/3: eggshell on ground 4/13: blue paper in nest" +2023,vacation,231,greg,2023-02-20,,,,"4/3: egg likely dead 4/13: dead chick in nest, orange paper to the S. East near nest 4/18: dead chick under nest--mercury sampled" +2023,vacation,231,greg,2023-02-27,2,,incubating,"4/3: egg likely dead 4/13: dead chick in nest, orange paper to the S. East near nest 4/18: dead chick under nest--mercury sampled" +2023,vacation,231,greg,2023-03-06,3,,incubating,"4/3: egg likely dead 4/13: dead chick in nest, orange paper to the S. East near nest 4/18: dead chick under nest--mercury sampled" +2023,vacation,231,greg,2023-03-13,3,,incubating,"4/3: egg likely dead 4/13: dead chick in nest, orange paper to the S. East near nest 4/18: dead chick under nest--mercury sampled" +2023,vacation,231,greg,2023-03-20,3,,incubating,"4/3: egg likely dead 4/13: dead chick in nest, orange paper to the S. East near nest 4/18: dead chick under nest--mercury sampled" +2023,vacation,231,greg,2023-03-27,1,2,chick_dry,"4/3: egg likely dead 4/13: dead chick in nest, orange paper to the S. East near nest 4/18: dead chick under nest--mercury sampled" +2023,vacation,231,greg,2023-04-03,1,2,nestling,"4/3: egg likely dead 4/13: dead chick in nest, orange paper to the S. East near nest 4/18: dead chick under nest--mercury sampled" +2023,vacation,231,greg,2023-04-13,,1,nestling,"4/3: egg likely dead 4/13: dead chick in nest, orange paper to the S. East near nest 4/18: dead chick under nest--mercury sampled" +2023,vacation,231,greg,2023-04-18,,,empty,"4/3: egg likely dead 4/13: dead chick in nest, orange paper to the S. East near nest 4/18: dead chick under nest--mercury sampled" +2023,vacation,231,greg,2023-04-24,,,pulled,"4/3: egg likely dead 4/13: dead chick in nest, orange paper to the S. East near nest 4/18: dead chick under nest--mercury sampled" +2023,vacation,231,greg,2023-05-01,,,,"4/3: egg likely dead 4/13: dead chick in nest, orange paper to the S. East near nest 4/18: dead chick under nest--mercury sampled" +2023,vacation,231,greg,2023-05-08,,,,"4/3: egg likely dead 4/13: dead chick in nest, orange paper to the S. East near nest 4/18: dead chick under nest--mercury sampled" +2023,vacation,233,greg,2023-02-20,,,,"3/20: eggshells on ground 4/13: pink paper near where nest was" +2023,vacation,233,greg,2023-02-27,2,,incubating,"3/20: eggshells on ground 4/13: pink paper near where nest was" +2023,vacation,233,greg,2023-03-06,2,,incubating,"3/20: eggshells on ground 4/13: pink paper near where nest was" +2023,vacation,233,greg,2023-03-13,,,empty,"3/20: eggshells on ground 4/13: pink paper near where nest was" +2023,vacation,233,greg,2023-03-20,,,,"3/20: eggshells on ground 4/13: pink paper near where nest was" +2023,vacation,233,greg,2023-03-27,,,,"3/20: eggshells on ground 4/13: pink paper near where nest was" +2023,vacation,233,greg,2023-04-03,,,,"3/20: eggshells on ground 4/13: pink paper near where nest was" +2023,vacation,233,greg,2023-04-13,,,,"3/20: eggshells on ground 4/13: pink paper near where nest was" +2023,vacation,233,greg,2023-04-18,,,,"3/20: eggshells on ground 4/13: pink paper near where nest was" +2023,vacation,233,greg,2023-04-24,,,,"3/20: eggshells on ground 4/13: pink paper near where nest was" +2023,vacation,233,greg,2023-05-01,,,,"3/20: eggshells on ground 4/13: pink paper near where nest was" +2023,vacation,233,greg,2023-05-08,,,,"3/20: eggshells on ground 4/13: pink paper near where nest was" +2023,vacation,235,greg,2023-02-20,,,,"3/27: nest mostly gone 4/13: orange paper in tree top" +2023,vacation,235,greg,2023-02-27,3,,incubating,"3/27: nest mostly gone 4/13: orange paper in tree top" +2023,vacation,235,greg,2023-03-06,3,,incubating,"3/27: nest mostly gone 4/13: orange paper in tree top" +2023,vacation,235,greg,2023-03-13,3,,incubating,"3/27: nest mostly gone 4/13: orange paper in tree top" +2023,vacation,235,greg,2023-03-20,,,empty,"3/27: nest mostly gone 4/13: orange paper in tree top" +2023,vacation,235,greg,2023-03-27,,,,"3/27: nest mostly gone 4/13: orange paper in tree top" +2023,vacation,235,greg,2023-04-03,,,,"3/27: nest mostly gone 4/13: orange paper in tree top" +2023,vacation,235,greg,2023-04-13,,,,"3/27: nest mostly gone 4/13: orange paper in tree top" +2023,vacation,235,greg,2023-04-18,,,,"3/27: nest mostly gone 4/13: orange paper in tree top" +2023,vacation,235,greg,2023-04-24,,,,"3/27: nest mostly gone 4/13: orange paper in tree top" +2023,vacation,235,greg,2023-05-01,,,,"3/27: nest mostly gone 4/13: orange paper in tree top" +2023,vacation,235,greg,2023-05-08,,,,"3/27: nest mostly gone 4/13: orange paper in tree top" +2023,vacation,218,greg,2023-02-20,,,,"3/20: eggshells on ground 4/13: blue paper in nest" +2023,vacation,218,greg,2023-02-27,2,,incubating,"3/20: eggshells on ground 4/13: blue paper in nest" +2023,vacation,218,greg,2023-03-06,,,empty,"3/20: eggshells on ground 4/13: blue paper in nest" +2023,vacation,218,greg,2023-03-13,,,,"3/20: eggshells on ground 4/13: blue paper in nest" +2023,vacation,218,greg,2023-03-20,,,,"3/20: eggshells on ground 4/13: blue paper in nest" +2023,vacation,218,greg,2023-03-27,,,,"3/20: eggshells on ground 4/13: blue paper in nest" +2023,vacation,218,greg,2023-04-03,,,,"3/20: eggshells on ground 4/13: blue paper in nest" +2023,vacation,218,greg,2023-04-13,,,,"3/20: eggshells on ground 4/13: blue paper in nest" +2023,vacation,218,greg,2023-04-18,,,,"3/20: eggshells on ground 4/13: blue paper in nest" +2023,vacation,218,greg,2023-04-24,,,,"3/20: eggshells on ground 4/13: blue paper in nest" +2023,vacation,218,greg,2023-05-01,,,,"3/20: eggshells on ground 4/13: blue paper in nest" +2023,vacation,218,greg,2023-05-08,,,,"3/20: eggshells on ground 4/13: blue paper in nest" +2023,vacation,220,greg,2023-02-20,,,,"4/3: certain 3 chicks 4/13: one dead chick also in nest, live chick very small 4/24: chick sampled for mercury; 5/8: Flag pulled" +2023,vacation,220,greg,2023-02-27,3,,incubating,"4/3: certain 3 chicks 4/13: one dead chick also in nest, live chick very small 4/24: chick sampled for mercury; 5/8: Flag pulled" +2023,vacation,220,greg,2023-03-06,3,,incubating,"4/3: certain 3 chicks 4/13: one dead chick also in nest, live chick very small 4/24: chick sampled for mercury; 5/8: Flag pulled" +2023,vacation,220,greg,2023-03-13,3,,incubating,"4/3: certain 3 chicks 4/13: one dead chick also in nest, live chick very small 4/24: chick sampled for mercury; 5/8: Flag pulled" +2023,vacation,220,greg,2023-03-20,3,,incubating,"4/3: certain 3 chicks 4/13: one dead chick also in nest, live chick very small 4/24: chick sampled for mercury; 5/8: Flag pulled" +2023,vacation,220,greg,2023-03-27,,3,nestling,"4/3: certain 3 chicks 4/13: one dead chick also in nest, live chick very small 4/24: chick sampled for mercury; 5/8: Flag pulled" +2023,vacation,220,greg,2023-04-03,,3,nestling,"4/3: certain 3 chicks 4/13: one dead chick also in nest, live chick very small 4/24: chick sampled for mercury; 5/8: Flag pulled" +2023,vacation,220,greg,2023-04-13,,1,nestling,"4/3: certain 3 chicks 4/13: one dead chick also in nest, live chick very small 4/24: chick sampled for mercury; 5/8: Flag pulled" +2023,vacation,220,greg,2023-04-18,,1,nestling,"4/3: certain 3 chicks 4/13: one dead chick also in nest, live chick very small 4/24: chick sampled for mercury; 5/8: Flag pulled" +2023,vacation,220,greg,2023-04-24,,1,nestling,"4/3: certain 3 chicks 4/13: one dead chick also in nest, live chick very small 4/24: chick sampled for mercury; 5/8: Flag pulled" +2023,vacation,220,greg,2023-05-01,,1,branchling,"4/3: certain 3 chicks 4/13: one dead chick also in nest, live chick very small 4/24: chick sampled for mercury; 5/8: Flag pulled" +2023,vacation,220,greg,2023-05-08,,1,branchling,"4/3: certain 3 chicks 4/13: one dead chick also in nest, live chick very small 4/24: chick sampled for mercury; 5/8: Flag pulled" +2023,vacation,222,greg,2023-02-20,,,,"4/18: largest chick mercury sampled 4/24: Likely dead chick in nest as well, didn't fully check to avoid scaring off live chick; 5/8: Flag pulled" +2023,vacation,222,greg,2023-02-27,3,,incubating,"4/18: largest chick mercury sampled 4/24: Likely dead chick in nest as well, didn't fully check to avoid scaring off live chick; 5/8: Flag pulled" +2023,vacation,222,greg,2023-03-06,3,,incubating,"4/18: largest chick mercury sampled 4/24: Likely dead chick in nest as well, didn't fully check to avoid scaring off live chick; 5/8: Flag pulled" +2023,vacation,222,greg,2023-03-13,3,,incubating,"4/18: largest chick mercury sampled 4/24: Likely dead chick in nest as well, didn't fully check to avoid scaring off live chick; 5/8: Flag pulled" +2023,vacation,222,greg,2023-03-20,1,2,chick_dry,"4/18: largest chick mercury sampled 4/24: Likely dead chick in nest as well, didn't fully check to avoid scaring off live chick; 5/8: Flag pulled" +2023,vacation,222,greg,2023-03-27,,3,nestling,"4/18: largest chick mercury sampled 4/24: Likely dead chick in nest as well, didn't fully check to avoid scaring off live chick; 5/8: Flag pulled" +2023,vacation,222,greg,2023-04-03,,2,nestling,"4/18: largest chick mercury sampled 4/24: Likely dead chick in nest as well, didn't fully check to avoid scaring off live chick; 5/8: Flag pulled" +2023,vacation,222,greg,2023-04-13,,2,nestling,"4/18: largest chick mercury sampled 4/24: Likely dead chick in nest as well, didn't fully check to avoid scaring off live chick; 5/8: Flag pulled" +2023,vacation,222,greg,2023-04-18,,2,nestling,"4/18: largest chick mercury sampled 4/24: Likely dead chick in nest as well, didn't fully check to avoid scaring off live chick; 5/8: Flag pulled" +2023,vacation,222,greg,2023-04-24,,1,nestling,"4/18: largest chick mercury sampled 4/24: Likely dead chick in nest as well, didn't fully check to avoid scaring off live chick; 5/8: Flag pulled" +2023,vacation,222,greg,2023-05-01,,1,branchling,"4/18: largest chick mercury sampled 4/24: Likely dead chick in nest as well, didn't fully check to avoid scaring off live chick; 5/8: Flag pulled" +2023,vacation,222,greg,2023-05-08,,1,branchling,"4/18: largest chick mercury sampled 4/24: Likely dead chick in nest as well, didn't fully check to avoid scaring off live chick; 5/8: Flag pulled" +2023,vacation,224,greg,2023-02-20,,,,"3/6: eggshell on ground below nest 4/13: pink paper in nest" +2023,vacation,224,greg,2023-02-27,3,,incubating,"3/6: eggshell on ground below nest 4/13: pink paper in nest" +2023,vacation,224,greg,2023-03-06,,,empty,"3/6: eggshell on ground below nest 4/13: pink paper in nest" +2023,vacation,224,greg,2023-03-13,,,,"3/6: eggshell on ground below nest 4/13: pink paper in nest" +2023,vacation,224,greg,2023-03-20,,,,"3/6: eggshell on ground below nest 4/13: pink paper in nest" +2023,vacation,224,greg,2023-03-27,,,,"3/6: eggshell on ground below nest 4/13: pink paper in nest" +2023,vacation,224,greg,2023-04-03,,,,"3/6: eggshell on ground below nest 4/13: pink paper in nest" +2023,vacation,224,greg,2023-04-13,,,,"3/6: eggshell on ground below nest 4/13: pink paper in nest" +2023,vacation,224,greg,2023-04-18,,,,"3/6: eggshell on ground below nest 4/13: pink paper in nest" +2023,vacation,224,greg,2023-04-24,,,,"3/6: eggshell on ground below nest 4/13: pink paper in nest" +2023,vacation,224,greg,2023-05-01,,,,"3/6: eggshell on ground below nest 4/13: pink paper in nest" +2023,vacation,224,greg,2023-05-08,,,,"3/6: eggshell on ground below nest 4/13: pink paper in nest" +2023,vacation,237,greg,2023-02-20,,,,"4/3: certain 3 chicks 4/18: 1C+, one chick seen and didn't disturb to look for more 4/24: chick sampled for mercury; 5/8: Flag pulled" +2023,vacation,237,greg,2023-02-27,1,,incubating,"4/3: certain 3 chicks 4/18: 1C+, one chick seen and didn't disturb to look for more 4/24: chick sampled for mercury; 5/8: Flag pulled" +2023,vacation,237,greg,2023-03-06,3,,incubating,"4/3: certain 3 chicks 4/18: 1C+, one chick seen and didn't disturb to look for more 4/24: chick sampled for mercury; 5/8: Flag pulled" +2023,vacation,237,greg,2023-03-13,3,,incubating,"4/3: certain 3 chicks 4/18: 1C+, one chick seen and didn't disturb to look for more 4/24: chick sampled for mercury; 5/8: Flag pulled" +2023,vacation,237,greg,2023-03-20,3,,incubating,"4/3: certain 3 chicks 4/18: 1C+, one chick seen and didn't disturb to look for more 4/24: chick sampled for mercury; 5/8: Flag pulled" +2023,vacation,237,greg,2023-03-27,2,1,hatching,"4/3: certain 3 chicks 4/18: 1C+, one chick seen and didn't disturb to look for more 4/24: chick sampled for mercury; 5/8: Flag pulled" +2023,vacation,237,greg,2023-04-03,,3,nestling,"4/3: certain 3 chicks 4/18: 1C+, one chick seen and didn't disturb to look for more 4/24: chick sampled for mercury; 5/8: Flag pulled" +2023,vacation,237,greg,2023-04-13,,2,nestling,"4/3: certain 3 chicks 4/18: 1C+, one chick seen and didn't disturb to look for more 4/24: chick sampled for mercury; 5/8: Flag pulled" +2023,vacation,237,greg,2023-04-18,,1,nestling,"4/3: certain 3 chicks 4/18: 1C+, one chick seen and didn't disturb to look for more 4/24: chick sampled for mercury; 5/8: Flag pulled" +2023,vacation,237,greg,2023-04-24,,1,nestling,"4/3: certain 3 chicks 4/18: 1C+, one chick seen and didn't disturb to look for more 4/24: chick sampled for mercury; 5/8: Flag pulled" +2023,vacation,237,greg,2023-05-01,,1,branchling,"4/3: certain 3 chicks 4/18: 1C+, one chick seen and didn't disturb to look for more 4/24: chick sampled for mercury; 5/8: Flag pulled" +2023,vacation,237,greg,2023-05-08,,1,branchling,"4/3: certain 3 chicks 4/18: 1C+, one chick seen and didn't disturb to look for more 4/24: chick sampled for mercury; 5/8: Flag pulled" +2023,vacation,239,greg,2023-02-20,,,,"3/13: broken eggshell on ground; 4/3: eggshell on ground 4/13: blue paper in nest" +2023,vacation,239,greg,2023-02-27,3,,incubating,"3/13: broken eggshell on ground; 4/3: eggshell on ground 4/13: blue paper in nest" +2023,vacation,239,greg,2023-03-06,3,,incubating,"3/13: broken eggshell on ground; 4/3: eggshell on ground 4/13: blue paper in nest" +2023,vacation,239,greg,2023-03-13,,,empty,"3/13: broken eggshell on ground; 4/3: eggshell on ground 4/13: blue paper in nest" +2023,vacation,239,greg,2023-03-20,2,,incubating,"3/13: broken eggshell on ground; 4/3: eggshell on ground 4/13: blue paper in nest" +2023,vacation,239,greg,2023-03-27,2,,incubating,"3/13: broken eggshell on ground; 4/3: eggshell on ground 4/13: blue paper in nest" +2023,vacation,239,greg,2023-04-03,,,empty,"3/13: broken eggshell on ground; 4/3: eggshell on ground 4/13: blue paper in nest" +2023,vacation,239,greg,2023-04-13,,,,"3/13: broken eggshell on ground; 4/3: eggshell on ground 4/13: blue paper in nest" +2023,vacation,239,greg,2023-04-18,,,,"3/13: broken eggshell on ground; 4/3: eggshell on ground 4/13: blue paper in nest" +2023,vacation,239,greg,2023-04-24,,,,"3/13: broken eggshell on ground; 4/3: eggshell on ground 4/13: blue paper in nest" +2023,vacation,239,greg,2023-05-01,,,pulled,"3/13: broken eggshell on ground; 4/3: eggshell on ground 4/13: blue paper in nest" +2023,vacation,239,greg,2023-05-08,,,,"3/13: broken eggshell on ground; 4/3: eggshell on ground 4/13: blue paper in nest" +2023,vacation,241,greg,2023-02-20,,,,"2/27 on blue flagged offshoot off to the right, 3/20:one egg pipping, 1 chick wet. 4/13: pink paper in nest" +2023,vacation,241,greg,2023-02-27,2,,incubating,"2/27 on blue flagged offshoot off to the right, 3/20:one egg pipping, 1 chick wet. 4/13: pink paper in nest" +2023,vacation,241,greg,2023-03-06,2,,incubating,"2/27 on blue flagged offshoot off to the right, 3/20:one egg pipping, 1 chick wet. 4/13: pink paper in nest" +2023,vacation,241,greg,2023-03-13,2,,incubating,"2/27 on blue flagged offshoot off to the right, 3/20:one egg pipping, 1 chick wet. 4/13: pink paper in nest" +2023,vacation,241,greg,2023-03-20,1,1,wet_chick,"2/27 on blue flagged offshoot off to the right, 3/20:one egg pipping, 1 chick wet. 4/13: pink paper in nest" +2023,vacation,241,greg,2023-03-27,,,empty,"2/27 on blue flagged offshoot off to the right, 3/20:one egg pipping, 1 chick wet. 4/13: pink paper in nest" +2023,vacation,241,greg,2023-04-03,,,,"2/27 on blue flagged offshoot off to the right, 3/20:one egg pipping, 1 chick wet. 4/13: pink paper in nest" +2023,vacation,241,greg,2023-04-13,,,,"2/27 on blue flagged offshoot off to the right, 3/20:one egg pipping, 1 chick wet. 4/13: pink paper in nest" +2023,vacation,241,greg,2023-04-18,,,,"2/27 on blue flagged offshoot off to the right, 3/20:one egg pipping, 1 chick wet. 4/13: pink paper in nest" +2023,vacation,241,greg,2023-04-24,,,,"2/27 on blue flagged offshoot off to the right, 3/20:one egg pipping, 1 chick wet. 4/13: pink paper in nest" +2023,vacation,241,greg,2023-05-01,,,,"2/27 on blue flagged offshoot off to the right, 3/20:one egg pipping, 1 chick wet. 4/13: pink paper in nest" +2023,vacation,241,greg,2023-05-08,,,,"2/27 on blue flagged offshoot off to the right, 3/20:one egg pipping, 1 chick wet. 4/13: pink paper in nest" +2023,vacation,226,greg,2023-02-20,,,,"2/27 on blue flagged offshoot off to the right 4/24: chick sampled for mercury; 5/8: Flag pulled" +2023,vacation,226,greg,2023-02-27,1,,incubating,"2/27 on blue flagged offshoot off to the right 4/24: chick sampled for mercury; 5/8: Flag pulled" +2023,vacation,226,greg,2023-03-06,3,,incubating,"2/27 on blue flagged offshoot off to the right 4/24: chick sampled for mercury; 5/8: Flag pulled" +2023,vacation,226,greg,2023-03-13,3,,incubating,"2/27 on blue flagged offshoot off to the right 4/24: chick sampled for mercury; 5/8: Flag pulled" +2023,vacation,226,greg,2023-03-20,3,,incubating,"2/27 on blue flagged offshoot off to the right 4/24: chick sampled for mercury; 5/8: Flag pulled" +2023,vacation,226,greg,2023-03-27,1,2,hatching,"2/27 on blue flagged offshoot off to the right 4/24: chick sampled for mercury; 5/8: Flag pulled" +2023,vacation,226,greg,2023-04-03,,2,nestling,"2/27 on blue flagged offshoot off to the right 4/24: chick sampled for mercury; 5/8: Flag pulled" +2023,vacation,226,greg,2023-04-13,,2,nestling,"2/27 on blue flagged offshoot off to the right 4/24: chick sampled for mercury; 5/8: Flag pulled" +2023,vacation,226,greg,2023-04-18,,1,nestling,"2/27 on blue flagged offshoot off to the right 4/24: chick sampled for mercury; 5/8: Flag pulled" +2023,vacation,226,greg,2023-04-24,,1,nestling,"2/27 on blue flagged offshoot off to the right 4/24: chick sampled for mercury; 5/8: Flag pulled" +2023,vacation,226,greg,2023-05-01,,1,branchling,"2/27 on blue flagged offshoot off to the right 4/24: chick sampled for mercury; 5/8: Flag pulled" +2023,vacation,226,greg,2023-05-08,,1,branchling,"2/27 on blue flagged offshoot off to the right 4/24: chick sampled for mercury; 5/8: Flag pulled" +2023,vacation,243,greg,2023-02-20,,,,"3/6: three whole eggs on the ground below nest, unbroken! 3/27: nest gone 4/13: orange paper" +2023,vacation,243,greg,2023-02-27,1,,incubating,"3/6: three whole eggs on the ground below nest, unbroken! 3/27: nest gone 4/13: orange paper" +2023,vacation,243,greg,2023-03-06,,,empty,"3/6: three whole eggs on the ground below nest, unbroken! 3/27: nest gone 4/13: orange paper" +2023,vacation,243,greg,2023-03-13,,,,"3/6: three whole eggs on the ground below nest, unbroken! 3/27: nest gone 4/13: orange paper" +2023,vacation,243,greg,2023-03-20,,,,"3/6: three whole eggs on the ground below nest, unbroken! 3/27: nest gone 4/13: orange paper" +2023,vacation,243,greg,2023-03-27,,,,"3/6: three whole eggs on the ground below nest, unbroken! 3/27: nest gone 4/13: orange paper" +2023,vacation,243,greg,2023-04-03,,,,"3/6: three whole eggs on the ground below nest, unbroken! 3/27: nest gone 4/13: orange paper" +2023,vacation,243,greg,2023-04-13,,,,"3/6: three whole eggs on the ground below nest, unbroken! 3/27: nest gone 4/13: orange paper" +2023,vacation,243,greg,2023-04-18,,,,"3/6: three whole eggs on the ground below nest, unbroken! 3/27: nest gone 4/13: orange paper" +2023,vacation,243,greg,2023-04-24,,,,"3/6: three whole eggs on the ground below nest, unbroken! 3/27: nest gone 4/13: orange paper" +2023,vacation,243,greg,2023-05-01,,,,"3/6: three whole eggs on the ground below nest, unbroken! 3/27: nest gone 4/13: orange paper" +2023,vacation,243,greg,2023-05-08,,,,"3/6: three whole eggs on the ground below nest, unbroken! 3/27: nest gone 4/13: orange paper" +2023,vacation,245,greg,2023-02-20,,,,"4/13: parent present 4/24: chick sampled for mercury; 5/8: Flag pulled. Dead chick in nest" +2023,vacation,245,greg,2023-02-27,2,,incubating,"4/13: parent present 4/24: chick sampled for mercury; 5/8: Flag pulled. Dead chick in nest" +2023,vacation,245,greg,2023-03-06,3,,incubating,"4/13: parent present 4/24: chick sampled for mercury; 5/8: Flag pulled. Dead chick in nest" +2023,vacation,245,greg,2023-03-13,3,,incubating,"4/13: parent present 4/24: chick sampled for mercury; 5/8: Flag pulled. Dead chick in nest" +2023,vacation,245,greg,2023-03-20,3,,incubating,"4/13: parent present 4/24: chick sampled for mercury; 5/8: Flag pulled. Dead chick in nest" +2023,vacation,245,greg,2023-03-27,,3,nestling,"4/13: parent present 4/24: chick sampled for mercury; 5/8: Flag pulled. Dead chick in nest" +2023,vacation,245,greg,2023-04-03,,3,nestling,"4/13: parent present 4/24: chick sampled for mercury; 5/8: Flag pulled. Dead chick in nest" +2023,vacation,245,greg,2023-04-13,,2,nestling,"4/13: parent present 4/24: chick sampled for mercury; 5/8: Flag pulled. Dead chick in nest" +2023,vacation,245,greg,2023-04-18,,1,nestling,"4/13: parent present 4/24: chick sampled for mercury; 5/8: Flag pulled. Dead chick in nest" +2023,vacation,245,greg,2023-04-24,,1,nestling,"4/13: parent present 4/24: chick sampled for mercury; 5/8: Flag pulled. Dead chick in nest" +2023,vacation,245,greg,2023-05-01,,1,branchling,"4/13: parent present 4/24: chick sampled for mercury; 5/8: Flag pulled. Dead chick in nest" +2023,vacation,245,greg,2023-05-08,,,empty,"4/13: parent present 4/24: chick sampled for mercury; 5/8: Flag pulled. Dead chick in nest" +2023,vacation,249,greg,2023-02-20,,,,"4/3: eggshell in nest" +2023,vacation,249,greg,2023-02-27,1,,incubating,"4/3: eggshell in nest" +2023,vacation,249,greg,2023-03-06,1,,incubating,"4/3: eggshell in nest" +2023,vacation,249,greg,2023-03-13,,,empty,"4/3: eggshell in nest" +2023,vacation,249,greg,2023-03-20,1,,incubating,"4/3: eggshell in nest" +2023,vacation,249,greg,2023-03-27,3,,incubating,"4/3: eggshell in nest" +2023,vacation,249,greg,2023-04-03,,,empty,"4/3: eggshell in nest" +2023,vacation,249,greg,2023-04-13,,,,"4/3: eggshell in nest" +2023,vacation,249,greg,2023-04-18,,,,"4/3: eggshell in nest" +2023,vacation,249,greg,2023-04-24,,,,"4/3: eggshell in nest" +2023,vacation,249,greg,2023-05-01,,,,"4/3: eggshell in nest" +2023,vacation,249,greg,2023-05-08,,,,"4/3: eggshell in nest" +2023,vacation,247,greg,2023-02-20,,,,"3/6: eggshells on the ground below nest" +2023,vacation,247,greg,2023-02-27,2,,incubating,"3/6: eggshells on the ground below nest" +2023,vacation,247,greg,2023-03-06,,,empty,"3/6: eggshells on the ground below nest" +2023,vacation,247,greg,2023-03-13,,,,"3/6: eggshells on the ground below nest" +2023,vacation,247,greg,2023-03-20,,,,"3/6: eggshells on the ground below nest" +2023,vacation,247,greg,2023-03-27,,,,"3/6: eggshells on the ground below nest" +2023,vacation,247,greg,2023-04-03,,,,"3/6: eggshells on the ground below nest" +2023,vacation,247,greg,2023-04-13,,,,"3/6: eggshells on the ground below nest" +2023,vacation,247,greg,2023-04-18,,,,"3/6: eggshells on the ground below nest" +2023,vacation,247,greg,2023-04-24,,,,"3/6: eggshells on the ground below nest" +2023,vacation,247,greg,2023-05-01,,,,"3/6: eggshells on the ground below nest" +2023,vacation,247,greg,2023-05-08,,,,"3/6: eggshells on the ground below nest" +2023,vacation,251,greg,2023-02-20,,,,"4/13: blue paper in nest" +2023,vacation,251,greg,2023-02-27,3,,incubating,"4/13: blue paper in nest" +2023,vacation,251,greg,2023-03-06,3,,incubating,"4/13: blue paper in nest" +2023,vacation,251,greg,2023-03-13,3,,incubating,"4/13: blue paper in nest" +2023,vacation,251,greg,2023-03-20,3,,incubating,"4/13: blue paper in nest" +2023,vacation,251,greg,2023-03-27,,,empty,"4/13: blue paper in nest" +2023,vacation,251,greg,2023-04-03,,,,"4/13: blue paper in nest" +2023,vacation,251,greg,2023-04-13,,,,"4/13: blue paper in nest" +2023,vacation,251,greg,2023-04-18,,,,"4/13: blue paper in nest" +2023,vacation,251,greg,2023-04-24,,,,"4/13: blue paper in nest" +2023,vacation,251,greg,2023-05-01,,,,"4/13: blue paper in nest" +2023,vacation,251,greg,2023-05-08,,,,"4/13: blue paper in nest" +2023,vacation,259,gbhe,2023-02-20,,,,"4/13: pink paper in vicinity" +2023,vacation,259,gbhe,2023-02-27,3,,incubating,"4/13: pink paper in vicinity" +2023,vacation,259,gbhe,2023-03-06,3,,incubating,"4/13: pink paper in vicinity" +2023,vacation,259,gbhe,2023-03-13,2,1,wet_chick,"4/13: pink paper in vicinity" +2023,vacation,259,gbhe,2023-03-20,1,2,hatching,"4/13: pink paper in vicinity" +2023,vacation,259,gbhe,2023-03-27,,,empty,"4/13: pink paper in vicinity" +2023,vacation,259,gbhe,2023-04-03,,,,"4/13: pink paper in vicinity" +2023,vacation,259,gbhe,2023-04-13,,,,"4/13: pink paper in vicinity" +2023,vacation,259,gbhe,2023-04-18,,,,"4/13: pink paper in vicinity" +2023,vacation,259,gbhe,2023-04-24,,,,"4/13: pink paper in vicinity" +2023,vacation,259,gbhe,2023-05-01,,,,"4/13: pink paper in vicinity" +2023,vacation,259,gbhe,2023-05-08,,,,"4/13: pink paper in vicinity" +2023,vacation,253,greg,2023-02-20,,,,"3/27: 2-3 broken eggs in the nest 4/13: pink paper in nest, nest in subcanopy" +2023,vacation,253,greg,2023-02-27,3,,incubating,"3/27: 2-3 broken eggs in the nest 4/13: pink paper in nest, nest in subcanopy" +2023,vacation,253,greg,2023-03-06,3,,incubating,"3/27: 2-3 broken eggs in the nest 4/13: pink paper in nest, nest in subcanopy" +2023,vacation,253,greg,2023-03-13,3,,incubating,"3/27: 2-3 broken eggs in the nest 4/13: pink paper in nest, nest in subcanopy" +2023,vacation,253,greg,2023-03-20,3,,incubating,"3/27: 2-3 broken eggs in the nest 4/13: pink paper in nest, nest in subcanopy" +2023,vacation,253,greg,2023-03-27,,,empty,"3/27: 2-3 broken eggs in the nest 4/13: pink paper in nest, nest in subcanopy" +2023,vacation,253,greg,2023-04-03,,,,"3/27: 2-3 broken eggs in the nest 4/13: pink paper in nest, nest in subcanopy" +2023,vacation,253,greg,2023-04-13,,,,"3/27: 2-3 broken eggs in the nest 4/13: pink paper in nest, nest in subcanopy" +2023,vacation,253,greg,2023-04-18,,,,"3/27: 2-3 broken eggs in the nest 4/13: pink paper in nest, nest in subcanopy" +2023,vacation,253,greg,2023-04-24,,,,"3/27: 2-3 broken eggs in the nest 4/13: pink paper in nest, nest in subcanopy" +2023,vacation,253,greg,2023-05-01,,,,"3/27: 2-3 broken eggs in the nest 4/13: pink paper in nest, nest in subcanopy" +2023,vacation,253,greg,2023-05-08,,,,"3/27: 2-3 broken eggs in the nest 4/13: pink paper in nest, nest in subcanopy" +2023,vacation,255,greg,2023-02-20,,,,"4/13: yellow paper under nest" +2023,vacation,255,greg,2023-02-27,2,,incubating,"4/13: yellow paper under nest" +2023,vacation,255,greg,2023-03-06,3,,incubating,"4/13: yellow paper under nest" +2023,vacation,255,greg,2023-03-13,3,,incubating,"4/13: yellow paper under nest" +2023,vacation,255,greg,2023-03-20,3,,incubating,"4/13: yellow paper under nest" +2023,vacation,255,greg,2023-03-27,,3,nestling,"4/13: yellow paper under nest" +2023,vacation,255,greg,2023-04-03,,2,nestling,"4/13: yellow paper under nest" +2023,vacation,255,greg,2023-04-13,,,empty,"4/13: yellow paper under nest" +2023,vacation,255,greg,2023-04-18,,,,"4/13: yellow paper under nest" +2023,vacation,255,greg,2023-04-24,,,,"4/13: yellow paper under nest" +2023,vacation,255,greg,2023-05-01,,,,"4/13: yellow paper under nest" +2023,vacation,255,greg,2023-05-08,,,,"4/13: yellow paper under nest" +2023,vacation,257,gbhe,2023-02-20,,,,"3/6: eggshell of 2 eggs on the ground below nest" +2023,vacation,257,gbhe,2023-02-27,2,,incubating,"3/6: eggshell of 2 eggs on the ground below nest" +2023,vacation,257,gbhe,2023-03-06,,,empty,"3/6: eggshell of 2 eggs on the ground below nest" +2023,vacation,257,gbhe,2023-03-13,,,,"3/6: eggshell of 2 eggs on the ground below nest" +2023,vacation,257,gbhe,2023-03-20,,,,"3/6: eggshell of 2 eggs on the ground below nest" +2023,vacation,257,gbhe,2023-03-27,,,,"3/6: eggshell of 2 eggs on the ground below nest" +2023,vacation,257,gbhe,2023-04-03,,,,"3/6: eggshell of 2 eggs on the ground below nest" +2023,vacation,257,gbhe,2023-04-13,,,,"3/6: eggshell of 2 eggs on the ground below nest" +2023,vacation,257,gbhe,2023-04-18,,,,"3/6: eggshell of 2 eggs on the ground below nest" +2023,vacation,257,gbhe,2023-04-24,,,,"3/6: eggshell of 2 eggs on the ground below nest" +2023,vacation,257,gbhe,2023-05-01,,,,"3/6: eggshell of 2 eggs on the ground below nest" +2023,vacation,257,gbhe,2023-05-08,,,,"3/6: eggshell of 2 eggs on the ground below nest" +2023,vacation,347,greg,2023-02-20,,,,"3/6: new nest right before 229, behind too tall GBHE nest 3/27: nest gone" +2023,vacation,347,greg,2023-02-27,,,,"3/6: new nest right before 229, behind too tall GBHE nest 3/27: nest gone" +2023,vacation,347,greg,2023-03-06,2,,incubating,"3/6: new nest right before 229, behind too tall GBHE nest 3/27: nest gone" +2023,vacation,347,greg,2023-03-13,,,empty,"3/6: new nest right before 229, behind too tall GBHE nest 3/27: nest gone" +2023,vacation,347,greg,2023-03-20,,,,"3/6: new nest right before 229, behind too tall GBHE nest 3/27: nest gone" +2023,vacation,347,greg,2023-03-27,,,,"3/6: new nest right before 229, behind too tall GBHE nest 3/27: nest gone" +2023,vacation,347,greg,2023-04-03,,,,"3/6: new nest right before 229, behind too tall GBHE nest 3/27: nest gone" +2023,vacation,347,greg,2023-04-13,,,,"3/6: new nest right before 229, behind too tall GBHE nest 3/27: nest gone" +2023,vacation,347,greg,2023-04-18,,,,"3/6: new nest right before 229, behind too tall GBHE nest 3/27: nest gone" +2023,vacation,347,greg,2023-04-24,,,,"3/6: new nest right before 229, behind too tall GBHE nest 3/27: nest gone" +2023,vacation,347,greg,2023-05-01,,,,"3/6: new nest right before 229, behind too tall GBHE nest 3/27: nest gone" +2023,vacation,347,greg,2023-05-08,,,,"3/6: new nest right before 229, behind too tall GBHE nest 3/27: nest gone" +2023,vacation,349,greg,2023-02-20,,,,"3/20: eggshell on ground 4/13: nest gone" +2023,vacation,349,greg,2023-02-27,,,,"3/20: eggshell on ground 4/13: nest gone" +2023,vacation,349,greg,2023-03-06,2,,incubating,"3/20: eggshell on ground 4/13: nest gone" +2023,vacation,349,greg,2023-03-13,3,,incubating,"3/20: eggshell on ground 4/13: nest gone" +2023,vacation,349,greg,2023-03-20,,,empty,"3/20: eggshell on ground 4/13: nest gone" +2023,vacation,349,greg,2023-03-27,,,,"3/20: eggshell on ground 4/13: nest gone" +2023,vacation,349,greg,2023-04-03,,,,"3/20: eggshell on ground 4/13: nest gone" +2023,vacation,349,greg,2023-04-13,,,,"3/20: eggshell on ground 4/13: nest gone" +2023,vacation,349,greg,2023-04-18,,,,"3/20: eggshell on ground 4/13: nest gone" +2023,vacation,349,greg,2023-04-24,,,,"3/20: eggshell on ground 4/13: nest gone" +2023,vacation,349,greg,2023-05-01,,,,"3/20: eggshell on ground 4/13: nest gone" +2023,vacation,349,greg,2023-05-08,,,,"3/20: eggshell on ground 4/13: nest gone" +2023,vacation,336,greg,2023-02-20,,,,"3/6: next to 243 4/13: yellow paper in nest" +2023,vacation,336,greg,2023-02-27,,,,"3/6: next to 243 4/13: yellow paper in nest" +2023,vacation,336,greg,2023-03-06,3,,incubating,"3/6: next to 243 4/13: yellow paper in nest" +2023,vacation,336,greg,2023-03-13,,,empty,"3/6: next to 243 4/13: yellow paper in nest" +2023,vacation,336,greg,2023-03-20,,,,"3/6: next to 243 4/13: yellow paper in nest" +2023,vacation,336,greg,2023-03-27,,,,"3/6: next to 243 4/13: yellow paper in nest" +2023,vacation,336,greg,2023-04-03,,,,"3/6: next to 243 4/13: yellow paper in nest" +2023,vacation,336,greg,2023-04-13,,,,"3/6: next to 243 4/13: yellow paper in nest" +2023,vacation,336,greg,2023-04-18,,,,"3/6: next to 243 4/13: yellow paper in nest" +2023,vacation,336,greg,2023-04-24,,,,"3/6: next to 243 4/13: yellow paper in nest" +2023,vacation,336,greg,2023-05-01,,,,"3/6: next to 243 4/13: yellow paper in nest" +2023,vacation,336,greg,2023-05-08,,,,"3/6: next to 243 4/13: yellow paper in nest" +2023,vacation,338,greg,2023-02-20,,,,"3/6: after 336 4/13: blue paper in nest" +2023,vacation,338,greg,2023-02-27,,,,"3/6: after 336 4/13: blue paper in nest" +2023,vacation,338,greg,2023-03-06,2,,incubating,"3/6: after 336 4/13: blue paper in nest" +2023,vacation,338,greg,2023-03-13,2,,incubating,"3/6: after 336 4/13: blue paper in nest" +2023,vacation,338,greg,2023-03-20,2,,incubating,"3/6: after 336 4/13: blue paper in nest" +2023,vacation,338,greg,2023-03-27,2,,incubating,"3/6: after 336 4/13: blue paper in nest" +2023,vacation,338,greg,2023-04-03,,,empty,"3/6: after 336 4/13: blue paper in nest" +2023,vacation,338,greg,2023-04-13,,,,"3/6: after 336 4/13: blue paper in nest" +2023,vacation,338,greg,2023-04-18,,,,"3/6: after 336 4/13: blue paper in nest" +2023,vacation,338,greg,2023-04-24,,,,"3/6: after 336 4/13: blue paper in nest" +2023,vacation,338,greg,2023-05-01,,,,"3/6: after 336 4/13: blue paper in nest" +2023,vacation,338,greg,2023-05-08,,,,"3/6: after 336 4/13: blue paper in nest" +2023,vacation,351,greg,2023-02-20,,,,"3/6: nest along new curve to the right added to transect line 4/13: 3 dead chicks in nest, orange paper in nest" +2023,vacation,351,greg,2023-02-27,,,,"3/6: nest along new curve to the right added to transect line 4/13: 3 dead chicks in nest, orange paper in nest" +2023,vacation,351,greg,2023-03-06,3,,incubating,"3/6: nest along new curve to the right added to transect line 4/13: 3 dead chicks in nest, orange paper in nest" +2023,vacation,351,greg,2023-03-13,3,,incubating,"3/6: nest along new curve to the right added to transect line 4/13: 3 dead chicks in nest, orange paper in nest" +2023,vacation,351,greg,2023-03-20,3,,incubating,"3/6: nest along new curve to the right added to transect line 4/13: 3 dead chicks in nest, orange paper in nest" +2023,vacation,351,greg,2023-03-27,,3,nestling,"3/6: nest along new curve to the right added to transect line 4/13: 3 dead chicks in nest, orange paper in nest" +2023,vacation,351,greg,2023-04-03,,3,nestling,"3/6: nest along new curve to the right added to transect line 4/13: 3 dead chicks in nest, orange paper in nest" +2023,vacation,351,greg,2023-04-13,,,empty,"3/6: nest along new curve to the right added to transect line 4/13: 3 dead chicks in nest, orange paper in nest" +2023,vacation,351,greg,2023-04-18,,,,"3/6: nest along new curve to the right added to transect line 4/13: 3 dead chicks in nest, orange paper in nest" +2023,vacation,351,greg,2023-04-24,,,,"3/6: nest along new curve to the right added to transect line 4/13: 3 dead chicks in nest, orange paper in nest" +2023,vacation,351,greg,2023-05-01,,,,"3/6: nest along new curve to the right added to transect line 4/13: 3 dead chicks in nest, orange paper in nest" +2023,vacation,351,greg,2023-05-08,,,,"3/6: nest along new curve to the right added to transect line 4/13: 3 dead chicks in nest, orange paper in nest" +2023,vacation,346,greg,2023-02-20,,,,"3/6: nest along new curve to the right added to transect line 3/27: nest seems thinly constructed and eggs appear rolled" +2023,vacation,346,greg,2023-02-27,,,,"3/6: nest along new curve to the right added to transect line 3/27: nest seems thinly constructed and eggs appear rolled" +2023,vacation,346,greg,2023-03-06,3,,incubating,"3/6: nest along new curve to the right added to transect line 3/27: nest seems thinly constructed and eggs appear rolled" +2023,vacation,346,greg,2023-03-13,3,,incubating,"3/6: nest along new curve to the right added to transect line 3/27: nest seems thinly constructed and eggs appear rolled" +2023,vacation,346,greg,2023-03-20,3,,incubating,"3/6: nest along new curve to the right added to transect line 3/27: nest seems thinly constructed and eggs appear rolled" +2023,vacation,346,greg,2023-03-27,3,,incubating,"3/6: nest along new curve to the right added to transect line 3/27: nest seems thinly constructed and eggs appear rolled" +2023,vacation,346,greg,2023-04-03,,3,nestling,"3/6: nest along new curve to the right added to transect line 3/27: nest seems thinly constructed and eggs appear rolled" +2023,vacation,346,greg,2023-04-13,,2,nestling,"3/6: nest along new curve to the right added to transect line 3/27: nest seems thinly constructed and eggs appear rolled" +2023,vacation,346,greg,2023-04-18,,1,nestling,"3/6: nest along new curve to the right added to transect line 3/27: nest seems thinly constructed and eggs appear rolled" +2023,vacation,346,greg,2023-04-24,,1,nestling,"3/6: nest along new curve to the right added to transect line 3/27: nest seems thinly constructed and eggs appear rolled" +2023,vacation,346,greg,2023-05-01,,,empty,"3/6: nest along new curve to the right added to transect line 3/27: nest seems thinly constructed and eggs appear rolled" +2023,vacation,346,greg,2023-05-08,,,pulled,"3/6: nest along new curve to the right added to transect line 3/27: nest seems thinly constructed and eggs appear rolled" +2023,vacation,340,greg,2023-02-20,,,,"3/6: nest along new curve to the right added to transect line 4/13: 2 dead chicks" +2023,vacation,340,greg,2023-02-27,,,,"3/6: nest along new curve to the right added to transect line 4/13: 2 dead chicks" +2023,vacation,340,greg,2023-03-06,3,,incubating,"3/6: nest along new curve to the right added to transect line 4/13: 2 dead chicks" +2023,vacation,340,greg,2023-03-13,3,,incubating,"3/6: nest along new curve to the right added to transect line 4/13: 2 dead chicks" +2023,vacation,340,greg,2023-03-20,3,,incubating,"3/6: nest along new curve to the right added to transect line 4/13: 2 dead chicks" +2023,vacation,340,greg,2023-03-27,1,2,hatching,"3/6: nest along new curve to the right added to transect line 4/13: 2 dead chicks" +2023,vacation,340,greg,2023-04-03,,3,nestling,"3/6: nest along new curve to the right added to transect line 4/13: 2 dead chicks" +2023,vacation,340,greg,2023-04-13,,,empty,"3/6: nest along new curve to the right added to transect line 4/13: 2 dead chicks" +2023,vacation,340,greg,2023-04-18,,,,"3/6: nest along new curve to the right added to transect line 4/13: 2 dead chicks" +2023,vacation,340,greg,2023-04-24,,,,"3/6: nest along new curve to the right added to transect line 4/13: 2 dead chicks" +2023,vacation,340,greg,2023-05-01,,,,"3/6: nest along new curve to the right added to transect line 4/13: 2 dead chicks" +2023,vacation,340,greg,2023-05-08,,,,"3/6: nest along new curve to the right added to transect line 4/13: 2 dead chicks" +2023,vacation,342,greg,2023-02-20,,,,"3/6: nest along new curve to the right added to transect line; 3/20: eggshells in nest 3/27: nest partially gone 4/13: pink paper, nest in understory" +2023,vacation,342,greg,2023-02-27,,,,"3/6: nest along new curve to the right added to transect line; 3/20: eggshells in nest 3/27: nest partially gone 4/13: pink paper, nest in understory" +2023,vacation,342,greg,2023-03-06,2,,incubating,"3/6: nest along new curve to the right added to transect line; 3/20: eggshells in nest 3/27: nest partially gone 4/13: pink paper, nest in understory" +2023,vacation,342,greg,2023-03-13,2,,incubating,"3/6: nest along new curve to the right added to transect line; 3/20: eggshells in nest 3/27: nest partially gone 4/13: pink paper, nest in understory" +2023,vacation,342,greg,2023-03-20,,,empty,"3/6: nest along new curve to the right added to transect line; 3/20: eggshells in nest 3/27: nest partially gone 4/13: pink paper, nest in understory" +2023,vacation,342,greg,2023-03-27,,,,"3/6: nest along new curve to the right added to transect line; 3/20: eggshells in nest 3/27: nest partially gone 4/13: pink paper, nest in understory" +2023,vacation,342,greg,2023-04-03,,,,"3/6: nest along new curve to the right added to transect line; 3/20: eggshells in nest 3/27: nest partially gone 4/13: pink paper, nest in understory" +2023,vacation,342,greg,2023-04-13,,,,"3/6: nest along new curve to the right added to transect line; 3/20: eggshells in nest 3/27: nest partially gone 4/13: pink paper, nest in understory" +2023,vacation,342,greg,2023-04-18,,,,"3/6: nest along new curve to the right added to transect line; 3/20: eggshells in nest 3/27: nest partially gone 4/13: pink paper, nest in understory" +2023,vacation,342,greg,2023-04-24,,,,"3/6: nest along new curve to the right added to transect line; 3/20: eggshells in nest 3/27: nest partially gone 4/13: pink paper, nest in understory" +2023,vacation,342,greg,2023-05-01,,,,"3/6: nest along new curve to the right added to transect line; 3/20: eggshells in nest 3/27: nest partially gone 4/13: pink paper, nest in understory" +2023,vacation,342,greg,2023-05-08,,,,"3/6: nest along new curve to the right added to transect line; 3/20: eggshells in nest 3/27: nest partially gone 4/13: pink paper, nest in understory" +2023,vacation,344,greg,2023-02-20,,,,"3/6: nest along new curve to the right added to transect line; 3/20: eggshells on ground 4/3: nest gone" +2023,vacation,344,greg,2023-02-27,,,,"3/6: nest along new curve to the right added to transect line; 3/20: eggshells on ground 4/3: nest gone" +2023,vacation,344,greg,2023-03-06,2,,incubating,"3/6: nest along new curve to the right added to transect line; 3/20: eggshells on ground 4/3: nest gone" +2023,vacation,344,greg,2023-03-13,2,,incubating,"3/6: nest along new curve to the right added to transect line; 3/20: eggshells on ground 4/3: nest gone" +2023,vacation,344,greg,2023-03-20,,,empty,"3/6: nest along new curve to the right added to transect line; 3/20: eggshells on ground 4/3: nest gone" +2023,vacation,344,greg,2023-03-27,,,,"3/6: nest along new curve to the right added to transect line; 3/20: eggshells on ground 4/3: nest gone" +2023,vacation,344,greg,2023-04-03,,,,"3/6: nest along new curve to the right added to transect line; 3/20: eggshells on ground 4/3: nest gone" +2023,vacation,344,greg,2023-04-13,,,,"3/6: nest along new curve to the right added to transect line; 3/20: eggshells on ground 4/3: nest gone" +2023,vacation,344,greg,2023-04-18,,,,"3/6: nest along new curve to the right added to transect line; 3/20: eggshells on ground 4/3: nest gone" +2023,vacation,344,greg,2023-04-24,,,,"3/6: nest along new curve to the right added to transect line; 3/20: eggshells on ground 4/3: nest gone" +2023,vacation,344,greg,2023-05-01,,,pulled,"3/6: nest along new curve to the right added to transect line; 3/20: eggshells on ground 4/3: nest gone" +2023,vacation,344,greg,2023-05-08,,,,"3/6: nest along new curve to the right added to transect line; 3/20: eggshells on ground 4/3: nest gone" +2023,vacation,353,greg,2023-02-20,,,,"3/6: off to the left between 253 and 255; 4/3: two broken eggs in nest 4/13: pink in nest" +2023,vacation,353,greg,2023-02-27,,,,"3/6: off to the left between 253 and 255; 4/3: two broken eggs in nest 4/13: pink in nest" +2023,vacation,353,greg,2023-03-06,2,,incubating,"3/6: off to the left between 253 and 255; 4/3: two broken eggs in nest 4/13: pink in nest" +2023,vacation,353,greg,2023-03-13,3,,incubating,"3/6: off to the left between 253 and 255; 4/3: two broken eggs in nest 4/13: pink in nest" +2023,vacation,353,greg,2023-03-20,3,,incubating,"3/6: off to the left between 253 and 255; 4/3: two broken eggs in nest 4/13: pink in nest" +2023,vacation,353,greg,2023-03-27,3,,incubating,"3/6: off to the left between 253 and 255; 4/3: two broken eggs in nest 4/13: pink in nest" +2023,vacation,353,greg,2023-04-03,,,empty,"3/6: off to the left between 253 and 255; 4/3: two broken eggs in nest 4/13: pink in nest" +2023,vacation,353,greg,2023-04-13,,,,"3/6: off to the left between 253 and 255; 4/3: two broken eggs in nest 4/13: pink in nest" +2023,vacation,353,greg,2023-04-18,,,,"3/6: off to the left between 253 and 255; 4/3: two broken eggs in nest 4/13: pink in nest" +2023,vacation,353,greg,2023-04-24,,,,"3/6: off to the left between 253 and 255; 4/3: two broken eggs in nest 4/13: pink in nest" +2023,vacation,353,greg,2023-05-01,,,,"3/6: off to the left between 253 and 255; 4/3: two broken eggs in nest 4/13: pink in nest" +2023,vacation,353,greg,2023-05-08,,,,"3/6: off to the left between 253 and 255; 4/3: two broken eggs in nest 4/13: pink in nest" +2023,vacation,404,greg,2023-02-20,,,,"3/13: pretty far to the left, hard to see pink flag. After 244, before 237. Double blue flag to mark." +2023,vacation,404,greg,2023-02-27,,,,"3/13: pretty far to the left, hard to see pink flag. After 244, before 237. Double blue flag to mark." +2023,vacation,404,greg,2023-03-06,,,,"3/13: pretty far to the left, hard to see pink flag. After 244, before 237. Double blue flag to mark." +2023,vacation,404,greg,2023-03-13,2,,incubating,"3/13: pretty far to the left, hard to see pink flag. After 244, before 237. Double blue flag to mark." +2023,vacation,404,greg,2023-03-20,3,,incubating,"3/13: pretty far to the left, hard to see pink flag. After 244, before 237. Double blue flag to mark." +2023,vacation,404,greg,2023-03-27,3,,incubating,"3/13: pretty far to the left, hard to see pink flag. After 244, before 237. Double blue flag to mark." +2023,vacation,404,greg,2023-04-03,,,missed,"3/13: pretty far to the left, hard to see pink flag. After 244, before 237. Double blue flag to mark." +2023,vacation,404,greg,2023-04-13,,,empty,"3/13: pretty far to the left, hard to see pink flag. After 244, before 237. Double blue flag to mark." +2023,vacation,404,greg,2023-04-18,,,,"3/13: pretty far to the left, hard to see pink flag. After 244, before 237. Double blue flag to mark." +2023,vacation,404,greg,2023-04-24,,,,"3/13: pretty far to the left, hard to see pink flag. After 244, before 237. Double blue flag to mark." +2023,vacation,404,greg,2023-05-01,,,,"3/13: pretty far to the left, hard to see pink flag. After 244, before 237. Double blue flag to mark." +2023,vacation,404,greg,2023-05-08,,,,"3/13: pretty far to the left, hard to see pink flag. After 244, before 237. Double blue flag to mark." +2023,vacation,406,greg,2023-02-20,,,,"3/13: next to 346; 4/3: one slashed egg in nest 4/13: pink paper in nest" +2023,vacation,406,greg,2023-02-27,,,,"3/13: next to 346; 4/3: one slashed egg in nest 4/13: pink paper in nest" +2023,vacation,406,greg,2023-03-06,,,,"3/13: next to 346; 4/3: one slashed egg in nest 4/13: pink paper in nest" +2023,vacation,406,greg,2023-03-13,3,,incubating,"3/13: next to 346; 4/3: one slashed egg in nest 4/13: pink paper in nest" +2023,vacation,406,greg,2023-03-20,3,,incubating,"3/13: next to 346; 4/3: one slashed egg in nest 4/13: pink paper in nest" +2023,vacation,406,greg,2023-03-27,3,,incubating,"3/13: next to 346; 4/3: one slashed egg in nest 4/13: pink paper in nest" +2023,vacation,406,greg,2023-04-03,,,empty,"3/13: next to 346; 4/3: one slashed egg in nest 4/13: pink paper in nest" +2023,vacation,406,greg,2023-04-13,,,,"3/13: next to 346; 4/3: one slashed egg in nest 4/13: pink paper in nest" +2023,vacation,406,greg,2023-04-18,,,,"3/13: next to 346; 4/3: one slashed egg in nest 4/13: pink paper in nest" +2023,vacation,406,greg,2023-04-24,,,,"3/13: next to 346; 4/3: one slashed egg in nest 4/13: pink paper in nest" +2023,vacation,406,greg,2023-05-01,,,,"3/13: next to 346; 4/3: one slashed egg in nest 4/13: pink paper in nest" +2023,vacation,406,greg,2023-05-08,,,,"3/13: next to 346; 4/3: one slashed egg in nest 4/13: pink paper in nest" +2023,vacation,408,greg,2023-02-20,,,,"3/13: after 340; 4/3: eggshell on ground 4/13: orange paper in nest" +2023,vacation,408,greg,2023-02-27,,,,"3/13: after 340; 4/3: eggshell on ground 4/13: orange paper in nest" +2023,vacation,408,greg,2023-03-06,,,,"3/13: after 340; 4/3: eggshell on ground 4/13: orange paper in nest" +2023,vacation,408,greg,2023-03-13,3,,incubating,"3/13: after 340; 4/3: eggshell on ground 4/13: orange paper in nest" +2023,vacation,408,greg,2023-03-20,3,,incubating,"3/13: after 340; 4/3: eggshell on ground 4/13: orange paper in nest" +2023,vacation,408,greg,2023-03-27,3,,incubating,"3/13: after 340; 4/3: eggshell on ground 4/13: orange paper in nest" +2023,vacation,408,greg,2023-04-03,,,empty,"3/13: after 340; 4/3: eggshell on ground 4/13: orange paper in nest" +2023,vacation,408,greg,2023-04-13,,,,"3/13: after 340; 4/3: eggshell on ground 4/13: orange paper in nest" +2023,vacation,408,greg,2023-04-18,,,,"3/13: after 340; 4/3: eggshell on ground 4/13: orange paper in nest" +2023,vacation,408,greg,2023-04-24,,,,"3/13: after 340; 4/3: eggshell on ground 4/13: orange paper in nest" +2023,vacation,408,greg,2023-05-01,,,,"3/13: after 340; 4/3: eggshell on ground 4/13: orange paper in nest" +2023,vacation,408,greg,2023-05-08,,,,"3/13: after 340; 4/3: eggshell on ground 4/13: orange paper in nest" +2023,vacation,410,greg,2023-02-20,,,,"4/13: yellow paper in nest" +2023,vacation,410,greg,2023-02-27,,,,"4/13: yellow paper in nest" +2023,vacation,410,greg,2023-03-06,,,,"4/13: yellow paper in nest" +2023,vacation,410,greg,2023-03-13,2,,incubating,"4/13: yellow paper in nest" +2023,vacation,410,greg,2023-03-20,,,empty,"4/13: yellow paper in nest" +2023,vacation,410,greg,2023-03-27,,,,"4/13: yellow paper in nest" +2023,vacation,410,greg,2023-04-03,,,,"4/13: yellow paper in nest" +2023,vacation,410,greg,2023-04-13,,,,"4/13: yellow paper in nest" +2023,vacation,410,greg,2023-04-18,,,,"4/13: yellow paper in nest" +2023,vacation,410,greg,2023-04-24,,,,"4/13: yellow paper in nest" +2023,vacation,410,greg,2023-05-01,,,,"4/13: yellow paper in nest" +2023,vacation,410,greg,2023-05-08,,,,"4/13: yellow paper in nest" +2023,vacation,517,greg,2023-02-20,,,,"3/20: after 251; 4/3: eggshell on ground 4/13: yellow paper in nest, nest high" +2023,vacation,517,greg,2023-02-27,,,,"3/20: after 251; 4/3: eggshell on ground 4/13: yellow paper in nest, nest high" +2023,vacation,517,greg,2023-03-06,,,,"3/20: after 251; 4/3: eggshell on ground 4/13: yellow paper in nest, nest high" +2023,vacation,517,greg,2023-03-13,,,,"3/20: after 251; 4/3: eggshell on ground 4/13: yellow paper in nest, nest high" +2023,vacation,517,greg,2023-03-20,2,,incubating,"3/20: after 251; 4/3: eggshell on ground 4/13: yellow paper in nest, nest high" +2023,vacation,517,greg,2023-03-27,2,,incubating,"3/20: after 251; 4/3: eggshell on ground 4/13: yellow paper in nest, nest high" +2023,vacation,517,greg,2023-04-03,,,empty,"3/20: after 251; 4/3: eggshell on ground 4/13: yellow paper in nest, nest high" +2023,vacation,517,greg,2023-04-13,,,,"3/20: after 251; 4/3: eggshell on ground 4/13: yellow paper in nest, nest high" +2023,vacation,517,greg,2023-04-18,,,,"3/20: after 251; 4/3: eggshell on ground 4/13: yellow paper in nest, nest high" +2023,vacation,517,greg,2023-04-24,,,,"3/20: after 251; 4/3: eggshell on ground 4/13: yellow paper in nest, nest high" +2023,vacation,517,greg,2023-05-01,,,,"3/20: after 251; 4/3: eggshell on ground 4/13: yellow paper in nest, nest high" +2023,vacation,517,greg,2023-05-08,,,,"3/20: after 251; 4/3: eggshell on ground 4/13: yellow paper in nest, nest high" +2023,vacation,532,greg,2023-02-20,,,,"3/27: off to the left before intersection 4/18: eggshells in nest 4/24: eggshells on ground, pulled" +2023,vacation,532,greg,2023-02-27,,,,"3/27: off to the left before intersection 4/18: eggshells in nest 4/24: eggshells on ground, pulled" +2023,vacation,532,greg,2023-03-06,,,,"3/27: off to the left before intersection 4/18: eggshells in nest 4/24: eggshells on ground, pulled" +2023,vacation,532,greg,2023-03-13,,,,"3/27: off to the left before intersection 4/18: eggshells in nest 4/24: eggshells on ground, pulled" +2023,vacation,532,greg,2023-03-20,,,,"3/27: off to the left before intersection 4/18: eggshells in nest 4/24: eggshells on ground, pulled" +2023,vacation,532,greg,2023-03-27,3,,incubating,"3/27: off to the left before intersection 4/18: eggshells in nest 4/24: eggshells on ground, pulled" +2023,vacation,532,greg,2023-04-03,3,,incubating,"3/27: off to the left before intersection 4/18: eggshells in nest 4/24: eggshells on ground, pulled" +2023,vacation,532,greg,2023-04-13,3,,incubating,"3/27: off to the left before intersection 4/18: eggshells in nest 4/24: eggshells on ground, pulled" +2023,vacation,532,greg,2023-04-18,,,empty,"3/27: off to the left before intersection 4/18: eggshells in nest 4/24: eggshells on ground, pulled" +2023,vacation,532,greg,2023-04-24,,,pulled,"3/27: off to the left before intersection 4/18: eggshells in nest 4/24: eggshells on ground, pulled" +2023,vacation,532,greg,2023-05-01,,,,"3/27: off to the left before intersection 4/18: eggshells in nest 4/24: eggshells on ground, pulled" +2023,vacation,532,greg,2023-05-08,,,,"3/27: off to the left before intersection 4/18: eggshells in nest 4/24: eggshells on ground, pulled" +2023,vacation,534,greg,2023-02-20,,,,"3/27: near 233 4/13: yellow paper in nest" +2023,vacation,534,greg,2023-02-27,,,,"3/27: near 233 4/13: yellow paper in nest" +2023,vacation,534,greg,2023-03-06,,,,"3/27: near 233 4/13: yellow paper in nest" +2023,vacation,534,greg,2023-03-13,,,,"3/27: near 233 4/13: yellow paper in nest" +2023,vacation,534,greg,2023-03-20,,,,"3/27: near 233 4/13: yellow paper in nest" +2023,vacation,534,greg,2023-03-27,2,,incubating,"3/27: near 233 4/13: yellow paper in nest" +2023,vacation,534,greg,2023-04-03,2,,incubating,"3/27: near 233 4/13: yellow paper in nest" +2023,vacation,534,greg,2023-04-13,,,empty,"3/27: near 233 4/13: yellow paper in nest" +2023,vacation,534,greg,2023-04-18,,,,"3/27: near 233 4/13: yellow paper in nest" +2023,vacation,534,greg,2023-04-24,,,,"3/27: near 233 4/13: yellow paper in nest" +2023,vacation,534,greg,2023-05-01,,,,"3/27: near 233 4/13: yellow paper in nest" +2023,vacation,534,greg,2023-05-08,,,,"3/27: near 233 4/13: yellow paper in nest" +2023,vacation,536,greg,2023-02-20,,,, +2023,vacation,536,greg,2023-02-27,,,, +2023,vacation,536,greg,2023-03-06,,,, +2023,vacation,536,greg,2023-03-13,,,, +2023,vacation,536,greg,2023-03-20,,,, +2023,vacation,536,greg,2023-03-27,2,,incubating, +2023,vacation,536,greg,2023-04-03,2,,incubating, +2023,vacation,536,greg,2023-04-13,,,empty, +2023,vacation,536,greg,2023-04-18,,,, +2023,vacation,536,greg,2023-04-24,,,, +2023,vacation,536,greg,2023-05-01,,,, +2023,vacation,536,greg,2023-05-08,,,, +2023,vacation,617,greg,2023-02-20,,,,"4/13: smallest chick possibly dead 4/24: one old dead chick in nest" +2023,vacation,617,greg,2023-02-27,,,,"4/13: smallest chick possibly dead 4/24: one old dead chick in nest" +2023,vacation,617,greg,2023-03-06,,,,"4/13: smallest chick possibly dead 4/24: one old dead chick in nest" +2023,vacation,617,greg,2023-03-13,,,,"4/13: smallest chick possibly dead 4/24: one old dead chick in nest" +2023,vacation,617,greg,2023-03-20,,,,"4/13: smallest chick possibly dead 4/24: one old dead chick in nest" +2023,vacation,617,greg,2023-03-27,3,,incubating,"4/13: smallest chick possibly dead 4/24: one old dead chick in nest" +2023,vacation,617,greg,2023-04-03,3,,incubating,"4/13: smallest chick possibly dead 4/24: one old dead chick in nest" +2023,vacation,617,greg,2023-04-13,,3,nestling,"4/13: smallest chick possibly dead 4/24: one old dead chick in nest" +2023,vacation,617,greg,2023-04-18,,2,nestling,"4/13: smallest chick possibly dead 4/24: one old dead chick in nest" +2023,vacation,617,greg,2023-04-24,,1,nestling,"4/13: smallest chick possibly dead 4/24: one old dead chick in nest" +2023,vacation,617,greg,2023-05-01,,,empty,"4/13: smallest chick possibly dead 4/24: one old dead chick in nest" +2023,vacation,617,greg,2023-05-08,,,pulled,"4/13: smallest chick possibly dead 4/24: one old dead chick in nest" +2023,6th_bridge,57,bcnh,2023-02-22,1,,incubating,"3/21: 3+ BCNH eggs on the ground, nest taken over by WHIB" +2023,6th_bridge,57,bcnh,2023-03-01,3,,incubating,"3/21: 3+ BCNH eggs on the ground, nest taken over by WHIB" +2023,6th_bridge,57,bcnh,2023-03-08,4,,incubating,"3/21: 3+ BCNH eggs on the ground, nest taken over by WHIB" +2023,6th_bridge,57,bcnh,2023-03-14,4,,incubating,"3/21: 3+ BCNH eggs on the ground, nest taken over by WHIB" +2023,6th_bridge,57,bcnh,2023-03-21,,,empty,"3/21: 3+ BCNH eggs on the ground, nest taken over by WHIB" +2023,6th_bridge,57,bcnh,2023-03-28,,,,"3/21: 3+ BCNH eggs on the ground, nest taken over by WHIB" +2023,6th_bridge,57,bcnh,2023-04-04,,,,"3/21: 3+ BCNH eggs on the ground, nest taken over by WHIB" +2023,6th_bridge,57,bcnh,2023-04-15,,,,"3/21: 3+ BCNH eggs on the ground, nest taken over by WHIB" +2023,6th_bridge,57,bcnh,2023-04-20,,,,"3/21: 3+ BCNH eggs on the ground, nest taken over by WHIB" +2023,6th_bridge,57,bcnh,2023-04-27,,,,"3/21: 3+ BCNH eggs on the ground, nest taken over by WHIB" +2023,6th_bridge,57,bcnh,2023-05-03,,,,"3/21: 3+ BCNH eggs on the ground, nest taken over by WHIB" +2023,6th_bridge,*57,whib,2023-02-22,,,,"4/4: 2 predated eggs in nest 4/20: pulled flag" +2023,6th_bridge,*57,whib,2023-03-01,,,,"4/4: 2 predated eggs in nest 4/20: pulled flag" +2023,6th_bridge,*57,whib,2023-03-08,,,,"4/4: 2 predated eggs in nest 4/20: pulled flag" +2023,6th_bridge,*57,whib,2023-03-14,,,,"4/4: 2 predated eggs in nest 4/20: pulled flag" +2023,6th_bridge,*57,whib,2023-03-21,2,,incubating,"4/4: 2 predated eggs in nest 4/20: pulled flag" +2023,6th_bridge,*57,whib,2023-03-28,2,,incubating,"4/4: 2 predated eggs in nest 4/20: pulled flag" +2023,6th_bridge,*57,whib,2023-04-04,,,empty,"4/4: 2 predated eggs in nest 4/20: pulled flag" +2023,6th_bridge,*57,whib,2023-04-15,,,empty,"4/4: 2 predated eggs in nest 4/20: pulled flag" +2023,6th_bridge,*57,whib,2023-04-20,,,pulled,"4/4: 2 predated eggs in nest 4/20: pulled flag" +2023,6th_bridge,*57,whib,2023-04-27,,,,"4/4: 2 predated eggs in nest 4/20: pulled flag" +2023,6th_bridge,*57,whib,2023-05-03,,,,"4/4: 2 predated eggs in nest 4/20: pulled flag" +2023,6th_bridge,96,greg,2023-02-22,3,,incubating,"3/8: nest off to left of trail, before 57. Heard a chick while checking nest but couldn't see one. 5/3: flag pulled" +2023,6th_bridge,96,greg,2023-03-01,2,,incubating,"3/8: nest off to left of trail, before 57. Heard a chick while checking nest but couldn't see one. 5/3: flag pulled" +2023,6th_bridge,96,greg,2023-03-08,2,,incubating,"3/8: nest off to left of trail, before 57. Heard a chick while checking nest but couldn't see one. 5/3: flag pulled" +2023,6th_bridge,96,greg,2023-03-14,,2,nestling,"3/8: nest off to left of trail, before 57. Heard a chick while checking nest but couldn't see one. 5/3: flag pulled" +2023,6th_bridge,96,greg,2023-03-21,,2,nestling,"3/8: nest off to left of trail, before 57. Heard a chick while checking nest but couldn't see one. 5/3: flag pulled" +2023,6th_bridge,96,greg,2023-03-28,,2,nestling,"3/8: nest off to left of trail, before 57. Heard a chick while checking nest but couldn't see one. 5/3: flag pulled" +2023,6th_bridge,96,greg,2023-04-04,,2,nestling,"3/8: nest off to left of trail, before 57. Heard a chick while checking nest but couldn't see one. 5/3: flag pulled" +2023,6th_bridge,96,greg,2023-04-15,,2,nestling,"3/8: nest off to left of trail, before 57. Heard a chick while checking nest but couldn't see one. 5/3: flag pulled" +2023,6th_bridge,96,greg,2023-04-20,,,empty,"3/8: nest off to left of trail, before 57. Heard a chick while checking nest but couldn't see one. 5/3: flag pulled" +2023,6th_bridge,96,greg,2023-04-27,,1,branchling,"3/8: nest off to left of trail, before 57. Heard a chick while checking nest but couldn't see one. 5/3: flag pulled" +2023,6th_bridge,96,greg,2023-05-03,,1,branchling,"3/8: nest off to left of trail, before 57. Heard a chick while checking nest but couldn't see one. 5/3: flag pulled" +2023,6th_bridge,59,greg,2023-02-22,3,,incubating,"3/8: nest looks more like bcnh, now has eggs again, possible that original nest is gone and this is a new nest near the number. 3/28: nest taken over by GLIBs, GREG or BCNH eggshell on the ground below" +2023,6th_bridge,59,greg,2023-03-01,,,empty,"3/8: nest looks more like bcnh, now has eggs again, possible that original nest is gone and this is a new nest near the number. 3/28: nest taken over by GLIBs, GREG or BCNH eggshell on the ground below" +2023,6th_bridge,59,greg,2023-03-08,2,,incubating,"3/8: nest looks more like bcnh, now has eggs again, possible that original nest is gone and this is a new nest near the number. 3/28: nest taken over by GLIBs, GREG or BCNH eggshell on the ground below" +2023,6th_bridge,59,greg,2023-03-14,2,,incubating,"3/8: nest looks more like bcnh, now has eggs again, possible that original nest is gone and this is a new nest near the number. 3/28: nest taken over by GLIBs, GREG or BCNH eggshell on the ground below" +2023,6th_bridge,59,greg,2023-03-21,2,,incubating,"3/8: nest looks more like bcnh, now has eggs again, possible that original nest is gone and this is a new nest near the number. 3/28: nest taken over by GLIBs, GREG or BCNH eggshell on the ground below" +2023,6th_bridge,59,greg,2023-03-28,,,empty,"3/8: nest looks more like bcnh, now has eggs again, possible that original nest is gone and this is a new nest near the number. 3/28: nest taken over by GLIBs, GREG or BCNH eggshell on the ground below" +2023,6th_bridge,59,greg,2023-04-04,,,,"3/8: nest looks more like bcnh, now has eggs again, possible that original nest is gone and this is a new nest near the number. 3/28: nest taken over by GLIBs, GREG or BCNH eggshell on the ground below" +2023,6th_bridge,59,greg,2023-04-15,,,,"3/8: nest looks more like bcnh, now has eggs again, possible that original nest is gone and this is a new nest near the number. 3/28: nest taken over by GLIBs, GREG or BCNH eggshell on the ground below" +2023,6th_bridge,59,greg,2023-04-20,,,,"3/8: nest looks more like bcnh, now has eggs again, possible that original nest is gone and this is a new nest near the number. 3/28: nest taken over by GLIBs, GREG or BCNH eggshell on the ground below" +2023,6th_bridge,59,greg,2023-04-27,,,,"3/8: nest looks more like bcnh, now has eggs again, possible that original nest is gone and this is a new nest near the number. 3/28: nest taken over by GLIBs, GREG or BCNH eggshell on the ground below" +2023,6th_bridge,59,greg,2023-05-03,,,,"3/8: nest looks more like bcnh, now has eggs again, possible that original nest is gone and this is a new nest near the number. 3/28: nest taken over by GLIBs, GREG or BCNH eggshell on the ground below" +2023,6th_bridge,*59,glib,2023-02-22,,,,"4/15: chick dry; 4/27: Flag pulled" +2023,6th_bridge,*59,glib,2023-03-01,,,,"4/15: chick dry; 4/27: Flag pulled" +2023,6th_bridge,*59,glib,2023-03-08,,,,"4/15: chick dry; 4/27: Flag pulled" +2023,6th_bridge,*59,glib,2023-03-14,,,,"4/15: chick dry; 4/27: Flag pulled" +2023,6th_bridge,*59,glib,2023-03-21,,,,"4/15: chick dry; 4/27: Flag pulled" +2023,6th_bridge,*59,glib,2023-03-28,2,,incubating,"4/15: chick dry; 4/27: Flag pulled" +2023,6th_bridge,*59,glib,2023-04-04,3,,incubating,"4/15: chick dry; 4/27: Flag pulled" +2023,6th_bridge,*59,glib,2023-04-15,2,1,chick_dry,"4/15: chick dry; 4/27: Flag pulled" +2023,6th_bridge,*59,glib,2023-04-20,,3,nestling,"4/15: chick dry; 4/27: Flag pulled" +2023,6th_bridge,*59,glib,2023-04-27,,,empty,"4/15: chick dry; 4/27: Flag pulled" +2023,6th_bridge,*59,glib,2023-05-03,,,,"4/15: chick dry; 4/27: Flag pulled" +2023,6th_bridge,61,greg,2023-02-22,3,,incubating,"4/4: 1 chick dead; 4/27: Mercury sample, branchling marked in 98 could be from either nest 61 or 98 (was marked 61 in book, 98 here based on previous weeks), also one big dead chick in path just before 61/98" +2023,6th_bridge,61,greg,2023-03-01,2,,incubating,"4/4: 1 chick dead; 4/27: Mercury sample, branchling marked in 98 could be from either nest 61 or 98 (was marked 61 in book, 98 here based on previous weeks), also one big dead chick in path just before 61/98" +2023,6th_bridge,61,greg,2023-03-08,2,,incubating,"4/4: 1 chick dead; 4/27: Mercury sample, branchling marked in 98 could be from either nest 61 or 98 (was marked 61 in book, 98 here based on previous weeks), also one big dead chick in path just before 61/98" +2023,6th_bridge,61,greg,2023-03-14,2,,incubating,"4/4: 1 chick dead; 4/27: Mercury sample, branchling marked in 98 could be from either nest 61 or 98 (was marked 61 in book, 98 here based on previous weeks), also one big dead chick in path just before 61/98" +2023,6th_bridge,61,greg,2023-03-21,,2,nestling,"4/4: 1 chick dead; 4/27: Mercury sample, branchling marked in 98 could be from either nest 61 or 98 (was marked 61 in book, 98 here based on previous weeks), also one big dead chick in path just before 61/98" +2023,6th_bridge,61,greg,2023-03-28,,2,nestling,"4/4: 1 chick dead; 4/27: Mercury sample, branchling marked in 98 could be from either nest 61 or 98 (was marked 61 in book, 98 here based on previous weeks), also one big dead chick in path just before 61/98" +2023,6th_bridge,61,greg,2023-04-04,,1,nestling,"4/4: 1 chick dead; 4/27: Mercury sample, branchling marked in 98 could be from either nest 61 or 98 (was marked 61 in book, 98 here based on previous weeks), also one big dead chick in path just before 61/98" +2023,6th_bridge,61,greg,2023-04-15,,,empty,"4/4: 1 chick dead; 4/27: Mercury sample, branchling marked in 98 could be from either nest 61 or 98 (was marked 61 in book, 98 here based on previous weeks), also one big dead chick in path just before 61/98" +2023,6th_bridge,61,greg,2023-04-20,,,empty,"4/4: 1 chick dead; 4/27: Mercury sample, branchling marked in 98 could be from either nest 61 or 98 (was marked 61 in book, 98 here based on previous weeks), also one big dead chick in path just before 61/98" +2023,6th_bridge,61,greg,2023-04-27,,,empty,"4/4: 1 chick dead; 4/27: Mercury sample, branchling marked in 98 could be from either nest 61 or 98 (was marked 61 in book, 98 here based on previous weeks), also one big dead chick in path just before 61/98" +2023,6th_bridge,61,greg,2023-05-03,,,pulled,"4/4: 1 chick dead; 4/27: Mercury sample, branchling marked in 98 could be from either nest 61 or 98 (was marked 61 in book, 98 here based on previous weeks), also one big dead chick in path just before 61/98" +2023,6th_bridge,98,greg,2023-02-22,3,,incubating,"3/28: 2C+, chicks large and mobile, 3rd could've run off before being seen 4/4: mercury sampled chick; 4/27: Blue paper. Flag pulled, branchling could be from either nest 61 or 98 (was marked 61 in book, 98 here based on previous weeks), also one big dead chick in path just before 61/98" +2023,6th_bridge,98,greg,2023-03-01,,3,nestling,"3/28: 2C+, chicks large and mobile, 3rd could've run off before being seen 4/4: mercury sampled chick; 4/27: Blue paper. Flag pulled, branchling could be from either nest 61 or 98 (was marked 61 in book, 98 here based on previous weeks), also one big dead chick in path just before 61/98" +2023,6th_bridge,98,greg,2023-03-08,,3,nestling,"3/28: 2C+, chicks large and mobile, 3rd could've run off before being seen 4/4: mercury sampled chick; 4/27: Blue paper. Flag pulled, branchling could be from either nest 61 or 98 (was marked 61 in book, 98 here based on previous weeks), also one big dead chick in path just before 61/98" +2023,6th_bridge,98,greg,2023-03-14,,3,nestling,"3/28: 2C+, chicks large and mobile, 3rd could've run off before being seen 4/4: mercury sampled chick; 4/27: Blue paper. Flag pulled, branchling could be from either nest 61 or 98 (was marked 61 in book, 98 here based on previous weeks), also one big dead chick in path just before 61/98" +2023,6th_bridge,98,greg,2023-03-21,,3,nestling,"3/28: 2C+, chicks large and mobile, 3rd could've run off before being seen 4/4: mercury sampled chick; 4/27: Blue paper. Flag pulled, branchling could be from either nest 61 or 98 (was marked 61 in book, 98 here based on previous weeks), also one big dead chick in path just before 61/98" +2023,6th_bridge,98,greg,2023-03-28,,2,nestling,"3/28: 2C+, chicks large and mobile, 3rd could've run off before being seen 4/4: mercury sampled chick; 4/27: Blue paper. Flag pulled, branchling could be from either nest 61 or 98 (was marked 61 in book, 98 here based on previous weeks), also one big dead chick in path just before 61/98" +2023,6th_bridge,98,greg,2023-04-04,,2,nestling,"3/28: 2C+, chicks large and mobile, 3rd could've run off before being seen 4/4: mercury sampled chick; 4/27: Blue paper. Flag pulled, branchling could be from either nest 61 or 98 (was marked 61 in book, 98 here based on previous weeks), also one big dead chick in path just before 61/98" +2023,6th_bridge,98,greg,2023-04-15,,1,nestling,"3/28: 2C+, chicks large and mobile, 3rd could've run off before being seen 4/4: mercury sampled chick; 4/27: Blue paper. Flag pulled, branchling could be from either nest 61 or 98 (was marked 61 in book, 98 here based on previous weeks), also one big dead chick in path just before 61/98" +2023,6th_bridge,98,greg,2023-04-20,,1,branchling,"3/28: 2C+, chicks large and mobile, 3rd could've run off before being seen 4/4: mercury sampled chick; 4/27: Blue paper. Flag pulled, branchling could be from either nest 61 or 98 (was marked 61 in book, 98 here based on previous weeks), also one big dead chick in path just before 61/98" +2023,6th_bridge,98,greg,2023-04-27,,,empty,"3/28: 2C+, chicks large and mobile, 3rd could've run off before being seen 4/4: mercury sampled chick; 4/27: Blue paper. Flag pulled, branchling could be from either nest 61 or 98 (was marked 61 in book, 98 here based on previous weeks), also one big dead chick in path just before 61/98" +2023,6th_bridge,98,greg,2023-05-03,,,,"3/28: 2C+, chicks large and mobile, 3rd could've run off before being seen 4/4: mercury sampled chick; 4/27: Blue paper. Flag pulled, branchling could be from either nest 61 or 98 (was marked 61 in book, 98 here based on previous weeks), also one big dead chick in path just before 61/98" +2023,6th_bridge,102,smwh,2023-02-22,4,,incubating,"3/8: chicks damp but not wet 3/28: dead egg still in nest. Chicks not seen, but could have fled before we could see them. 4/20: pulled flag" +2023,6th_bridge,102,smwh,2023-03-01,4,,incubating,"3/8: chicks damp but not wet 3/28: dead egg still in nest. Chicks not seen, but could have fled before we could see them. 4/20: pulled flag" +2023,6th_bridge,102,smwh,2023-03-08,2,2,hatching,"3/8: chicks damp but not wet 3/28: dead egg still in nest. Chicks not seen, but could have fled before we could see them. 4/20: pulled flag" +2023,6th_bridge,102,smwh,2023-03-14,1,3,hatching,"3/8: chicks damp but not wet 3/28: dead egg still in nest. Chicks not seen, but could have fled before we could see them. 4/20: pulled flag" +2023,6th_bridge,102,smwh,2023-03-21,1,3,nestling,"3/8: chicks damp but not wet 3/28: dead egg still in nest. Chicks not seen, but could have fled before we could see them. 4/20: pulled flag" +2023,6th_bridge,102,smwh,2023-03-28,,,empty,"3/8: chicks damp but not wet 3/28: dead egg still in nest. Chicks not seen, but could have fled before we could see them. 4/20: pulled flag" +2023,6th_bridge,102,smwh,2023-04-04,,,empty,"3/8: chicks damp but not wet 3/28: dead egg still in nest. Chicks not seen, but could have fled before we could see them. 4/20: pulled flag" +2023,6th_bridge,102,smwh,2023-04-15,,,empty,"3/8: chicks damp but not wet 3/28: dead egg still in nest. Chicks not seen, but could have fled before we could see them. 4/20: pulled flag" +2023,6th_bridge,102,smwh,2023-04-20,,,pulled,"3/8: chicks damp but not wet 3/28: dead egg still in nest. Chicks not seen, but could have fled before we could see them. 4/20: pulled flag" +2023,6th_bridge,102,smwh,2023-04-27,,,,"3/8: chicks damp but not wet 3/28: dead egg still in nest. Chicks not seen, but could have fled before we could see them. 4/20: pulled flag" +2023,6th_bridge,102,smwh,2023-05-03,,,,"3/8: chicks damp but not wet 3/28: dead egg still in nest. Chicks not seen, but could have fled before we could see them. 4/20: pulled flag" +2023,6th_bridge,104,smwh,2023-02-22,3,,incubating,"3/14: 1 egg pipping 3/28: 2 WHIB-esque nests high above 102 and 104, not checked due to fleeing SMHE chicks 4/20: 1 SMWH running back from nest area, 1 big dead chick on ground (attempted to put chick back in nest, but ran back again); 4/27: Flag pulled, 2 dead SMWH chicks near this nest" +2023,6th_bridge,104,smwh,2023-03-01,4,,incubating,"3/14: 1 egg pipping 3/28: 2 WHIB-esque nests high above 102 and 104, not checked due to fleeing SMHE chicks 4/20: 1 SMWH running back from nest area, 1 big dead chick on ground (attempted to put chick back in nest, but ran back again); 4/27: Flag pulled, 2 dead SMWH chicks near this nest" +2023,6th_bridge,104,smwh,2023-03-08,4,,incubating,"3/14: 1 egg pipping 3/28: 2 WHIB-esque nests high above 102 and 104, not checked due to fleeing SMHE chicks 4/20: 1 SMWH running back from nest area, 1 big dead chick on ground (attempted to put chick back in nest, but ran back again); 4/27: Flag pulled, 2 dead SMWH chicks near this nest" +2023,6th_bridge,104,smwh,2023-03-14,2,2,pipping,"3/14: 1 egg pipping 3/28: 2 WHIB-esque nests high above 102 and 104, not checked due to fleeing SMHE chicks 4/20: 1 SMWH running back from nest area, 1 big dead chick on ground (attempted to put chick back in nest, but ran back again); 4/27: Flag pulled, 2 dead SMWH chicks near this nest" +2023,6th_bridge,104,smwh,2023-03-21,,4,nestling,"3/14: 1 egg pipping 3/28: 2 WHIB-esque nests high above 102 and 104, not checked due to fleeing SMHE chicks 4/20: 1 SMWH running back from nest area, 1 big dead chick on ground (attempted to put chick back in nest, but ran back again); 4/27: Flag pulled, 2 dead SMWH chicks near this nest" +2023,6th_bridge,104,smwh,2023-03-28,,3,nestling,"3/14: 1 egg pipping 3/28: 2 WHIB-esque nests high above 102 and 104, not checked due to fleeing SMHE chicks 4/20: 1 SMWH running back from nest area, 1 big dead chick on ground (attempted to put chick back in nest, but ran back again); 4/27: Flag pulled, 2 dead SMWH chicks near this nest" +2023,6th_bridge,104,smwh,2023-04-04,,2,nestling,"3/14: 1 egg pipping 3/28: 2 WHIB-esque nests high above 102 and 104, not checked due to fleeing SMHE chicks 4/20: 1 SMWH running back from nest area, 1 big dead chick on ground (attempted to put chick back in nest, but ran back again); 4/27: Flag pulled, 2 dead SMWH chicks near this nest" +2023,6th_bridge,104,smwh,2023-04-15,,,empty,"3/14: 1 egg pipping 3/28: 2 WHIB-esque nests high above 102 and 104, not checked due to fleeing SMHE chicks 4/20: 1 SMWH running back from nest area, 1 big dead chick on ground (attempted to put chick back in nest, but ran back again); 4/27: Flag pulled, 2 dead SMWH chicks near this nest" +2023,6th_bridge,104,smwh,2023-04-20,,,empty,"3/14: 1 egg pipping 3/28: 2 WHIB-esque nests high above 102 and 104, not checked due to fleeing SMHE chicks 4/20: 1 SMWH running back from nest area, 1 big dead chick on ground (attempted to put chick back in nest, but ran back again); 4/27: Flag pulled, 2 dead SMWH chicks near this nest" +2023,6th_bridge,104,smwh,2023-04-27,,,empty,"3/14: 1 egg pipping 3/28: 2 WHIB-esque nests high above 102 and 104, not checked due to fleeing SMHE chicks 4/20: 1 SMWH running back from nest area, 1 big dead chick on ground (attempted to put chick back in nest, but ran back again); 4/27: Flag pulled, 2 dead SMWH chicks near this nest" +2023,6th_bridge,104,smwh,2023-05-03,,,,"3/14: 1 egg pipping 3/28: 2 WHIB-esque nests high above 102 and 104, not checked due to fleeing SMHE chicks 4/20: 1 SMWH running back from nest area, 1 big dead chick on ground (attempted to put chick back in nest, but ran back again); 4/27: Flag pulled, 2 dead SMWH chicks near this nest" +2023,6th_bridge,69,rosp,2023-02-22,3,,incubating,"3/14: certain of just one chick; 4/27: Pink paper, big ROSP fledgling in canopy nearby" +2023,6th_bridge,69,rosp,2023-03-01,3,,incubating,"3/14: certain of just one chick; 4/27: Pink paper, big ROSP fledgling in canopy nearby" +2023,6th_bridge,69,rosp,2023-03-08,3,,incubating,"3/14: certain of just one chick; 4/27: Pink paper, big ROSP fledgling in canopy nearby" +2023,6th_bridge,69,rosp,2023-03-14,1,1,hatching,"3/14: certain of just one chick; 4/27: Pink paper, big ROSP fledgling in canopy nearby" +2023,6th_bridge,69,rosp,2023-03-21,1,1,nestling,"3/14: certain of just one chick; 4/27: Pink paper, big ROSP fledgling in canopy nearby" +2023,6th_bridge,69,rosp,2023-03-28,,1,nestling,"3/14: certain of just one chick; 4/27: Pink paper, big ROSP fledgling in canopy nearby" +2023,6th_bridge,69,rosp,2023-04-04,,1,branchling,"3/14: certain of just one chick; 4/27: Pink paper, big ROSP fledgling in canopy nearby" +2023,6th_bridge,69,rosp,2023-04-15,,,empty,"3/14: certain of just one chick; 4/27: Pink paper, big ROSP fledgling in canopy nearby" +2023,6th_bridge,69,rosp,2023-04-20,,,empty,"3/14: certain of just one chick; 4/27: Pink paper, big ROSP fledgling in canopy nearby" +2023,6th_bridge,69,rosp,2023-04-27,,,empty,"3/14: certain of just one chick; 4/27: Pink paper, big ROSP fledgling in canopy nearby" +2023,6th_bridge,69,rosp,2023-05-03,,,,"3/14: certain of just one chick; 4/27: Pink paper, big ROSP fledgling in canopy nearby" +2023,6th_bridge,100,bcnh,2023-02-22,3,,incubating,"3/28: chicks very large and mobile 4/4: 1 large BCNH chick up in canopy above 4/20: pulled flag" +2023,6th_bridge,100,bcnh,2023-03-01,1,2,hatching,"3/28: chicks very large and mobile 4/4: 1 large BCNH chick up in canopy above 4/20: pulled flag" +2023,6th_bridge,100,bcnh,2023-03-08,,3,nestling,"3/28: chicks very large and mobile 4/4: 1 large BCNH chick up in canopy above 4/20: pulled flag" +2023,6th_bridge,100,bcnh,2023-03-14,,3,nestling,"3/28: chicks very large and mobile 4/4: 1 large BCNH chick up in canopy above 4/20: pulled flag" +2023,6th_bridge,100,bcnh,2023-03-21,,3,nestling,"3/28: chicks very large and mobile 4/4: 1 large BCNH chick up in canopy above 4/20: pulled flag" +2023,6th_bridge,100,bcnh,2023-03-28,,3,nestling,"3/28: chicks very large and mobile 4/4: 1 large BCNH chick up in canopy above 4/20: pulled flag" +2023,6th_bridge,100,bcnh,2023-04-04,,1,branchling,"3/28: chicks very large and mobile 4/4: 1 large BCNH chick up in canopy above 4/20: pulled flag" +2023,6th_bridge,100,bcnh,2023-04-15,,,empty,"3/28: chicks very large and mobile 4/4: 1 large BCNH chick up in canopy above 4/20: pulled flag" +2023,6th_bridge,100,bcnh,2023-04-20,,,pulled,"3/28: chicks very large and mobile 4/4: 1 large BCNH chick up in canopy above 4/20: pulled flag" +2023,6th_bridge,100,bcnh,2023-04-27,,,,"3/28: chicks very large and mobile 4/4: 1 large BCNH chick up in canopy above 4/20: pulled flag" +2023,6th_bridge,100,bcnh,2023-05-03,,,,"3/28: chicks very large and mobile 4/4: 1 large BCNH chick up in canopy above 4/20: pulled flag" +2023,6th_bridge,63,smwh,2023-02-22,3,,incubating,"2/22: big eggs 3/14: new nest 412 is directly above 3/21: SNEG nearby 3/28: nest gone 4/20: pulled flag" +2023,6th_bridge,63,smwh,2023-03-01,4,,incubating,"2/22: big eggs 3/14: new nest 412 is directly above 3/21: SNEG nearby 3/28: nest gone 4/20: pulled flag" +2023,6th_bridge,63,smwh,2023-03-08,4,,incubating,"2/22: big eggs 3/14: new nest 412 is directly above 3/21: SNEG nearby 3/28: nest gone 4/20: pulled flag" +2023,6th_bridge,63,smwh,2023-03-14,2,2,wet_chick,"2/22: big eggs 3/14: new nest 412 is directly above 3/21: SNEG nearby 3/28: nest gone 4/20: pulled flag" +2023,6th_bridge,63,smwh,2023-03-21,,4,nestling,"2/22: big eggs 3/14: new nest 412 is directly above 3/21: SNEG nearby 3/28: nest gone 4/20: pulled flag" +2023,6th_bridge,63,smwh,2023-03-28,,,empty,"2/22: big eggs 3/14: new nest 412 is directly above 3/21: SNEG nearby 3/28: nest gone 4/20: pulled flag" +2023,6th_bridge,63,smwh,2023-04-04,,,empty,"2/22: big eggs 3/14: new nest 412 is directly above 3/21: SNEG nearby 3/28: nest gone 4/20: pulled flag" +2023,6th_bridge,63,smwh,2023-04-15,,,empty,"2/22: big eggs 3/14: new nest 412 is directly above 3/21: SNEG nearby 3/28: nest gone 4/20: pulled flag" +2023,6th_bridge,63,smwh,2023-04-20,,,pulled,"2/22: big eggs 3/14: new nest 412 is directly above 3/21: SNEG nearby 3/28: nest gone 4/20: pulled flag" +2023,6th_bridge,63,smwh,2023-04-27,,,,"2/22: big eggs 3/14: new nest 412 is directly above 3/21: SNEG nearby 3/28: nest gone 4/20: pulled flag" +2023,6th_bridge,63,smwh,2023-05-03,,,,"2/22: big eggs 3/14: new nest 412 is directly above 3/21: SNEG nearby 3/28: nest gone 4/20: pulled flag" +2023,6th_bridge,71,smwh,2023-02-22,1,,incubating,"3/28: one dead chick in nest 4/4: nest has cattail in it now, saw GLIB flush up from area" +2023,6th_bridge,71,smwh,2023-03-01,4,,incubating,"3/28: one dead chick in nest 4/4: nest has cattail in it now, saw GLIB flush up from area" +2023,6th_bridge,71,smwh,2023-03-08,4,,incubating,"3/28: one dead chick in nest 4/4: nest has cattail in it now, saw GLIB flush up from area" +2023,6th_bridge,71,smwh,2023-03-14,4,,incubating,"3/28: one dead chick in nest 4/4: nest has cattail in it now, saw GLIB flush up from area" +2023,6th_bridge,71,smwh,2023-03-21,1,3,chick_dry,"3/28: one dead chick in nest 4/4: nest has cattail in it now, saw GLIB flush up from area" +2023,6th_bridge,71,smwh,2023-03-28,,,empty,"3/28: one dead chick in nest 4/4: nest has cattail in it now, saw GLIB flush up from area" +2023,6th_bridge,71,smwh,2023-04-04,,,empty,"3/28: one dead chick in nest 4/4: nest has cattail in it now, saw GLIB flush up from area" +2023,6th_bridge,71,smwh,2023-04-15,,,empty,"3/28: one dead chick in nest 4/4: nest has cattail in it now, saw GLIB flush up from area" +2023,6th_bridge,71,smwh,2023-04-20,,,empty,"3/28: one dead chick in nest 4/4: nest has cattail in it now, saw GLIB flush up from area" +2023,6th_bridge,71,smwh,2023-04-27,,,pulled,"3/28: one dead chick in nest 4/4: nest has cattail in it now, saw GLIB flush up from area" +2023,6th_bridge,71,smwh,2023-05-03,,,,"3/28: one dead chick in nest 4/4: nest has cattail in it now, saw GLIB flush up from area" +2023,6th_bridge,269,bcnh,2023-02-22,,,,"3/28: nest gone 4/20: pulled flag" +2023,6th_bridge,269,bcnh,2023-03-01,3,,incubating,"3/28: nest gone 4/20: pulled flag" +2023,6th_bridge,269,bcnh,2023-03-08,3,,incubating,"3/28: nest gone 4/20: pulled flag" +2023,6th_bridge,269,bcnh,2023-03-14,,,empty,"3/28: nest gone 4/20: pulled flag" +2023,6th_bridge,269,bcnh,2023-03-21,,,missed,"3/28: nest gone 4/20: pulled flag" +2023,6th_bridge,269,bcnh,2023-03-28,,,empty,"3/28: nest gone 4/20: pulled flag" +2023,6th_bridge,269,bcnh,2023-04-04,,,empty,"3/28: nest gone 4/20: pulled flag" +2023,6th_bridge,269,bcnh,2023-04-15,,,,"3/28: nest gone 4/20: pulled flag" +2023,6th_bridge,269,bcnh,2023-04-20,,,pulled,"3/28: nest gone 4/20: pulled flag" +2023,6th_bridge,269,bcnh,2023-04-27,,,,"3/28: nest gone 4/20: pulled flag" +2023,6th_bridge,269,bcnh,2023-05-03,,,,"3/28: nest gone 4/20: pulled flag" +2023,6th_bridge,238,bcnh,2023-02-22,,,,"3/21: eggs look very small, more like SMHE 4/15: noted 1 dead egg, 1 dead chick in notebook, but this seems odd or may be from another nest, as chicks were never observed in this nest 4/20: pulled flag" +2023,6th_bridge,238,bcnh,2023-03-01,1,,incubating,"3/21: eggs look very small, more like SMHE 4/15: noted 1 dead egg, 1 dead chick in notebook, but this seems odd or may be from another nest, as chicks were never observed in this nest 4/20: pulled flag" +2023,6th_bridge,238,bcnh,2023-03-08,3,,incubating,"3/21: eggs look very small, more like SMHE 4/15: noted 1 dead egg, 1 dead chick in notebook, but this seems odd or may be from another nest, as chicks were never observed in this nest 4/20: pulled flag" +2023,6th_bridge,238,bcnh,2023-03-14,2,,incubating,"3/21: eggs look very small, more like SMHE 4/15: noted 1 dead egg, 1 dead chick in notebook, but this seems odd or may be from another nest, as chicks were never observed in this nest 4/20: pulled flag" +2023,6th_bridge,238,bcnh,2023-03-21,4,,incubating,"3/21: eggs look very small, more like SMHE 4/15: noted 1 dead egg, 1 dead chick in notebook, but this seems odd or may be from another nest, as chicks were never observed in this nest 4/20: pulled flag" +2023,6th_bridge,238,bcnh,2023-03-28,4,,incubating,"3/21: eggs look very small, more like SMHE 4/15: noted 1 dead egg, 1 dead chick in notebook, but this seems odd or may be from another nest, as chicks were never observed in this nest 4/20: pulled flag" +2023,6th_bridge,238,bcnh,2023-04-04,4,,incubating,"3/21: eggs look very small, more like SMHE 4/15: noted 1 dead egg, 1 dead chick in notebook, but this seems odd or may be from another nest, as chicks were never observed in this nest 4/20: pulled flag" +2023,6th_bridge,238,bcnh,2023-04-15,,,empty,"3/21: eggs look very small, more like SMHE 4/15: noted 1 dead egg, 1 dead chick in notebook, but this seems odd or may be from another nest, as chicks were never observed in this nest 4/20: pulled flag" +2023,6th_bridge,238,bcnh,2023-04-20,,,pulled,"3/21: eggs look very small, more like SMHE 4/15: noted 1 dead egg, 1 dead chick in notebook, but this seems odd or may be from another nest, as chicks were never observed in this nest 4/20: pulled flag" +2023,6th_bridge,238,bcnh,2023-04-27,,,,"3/21: eggs look very small, more like SMHE 4/15: noted 1 dead egg, 1 dead chick in notebook, but this seems odd or may be from another nest, as chicks were never observed in this nest 4/20: pulled flag" +2023,6th_bridge,238,bcnh,2023-05-03,,,,"3/21: eggs look very small, more like SMHE 4/15: noted 1 dead egg, 1 dead chick in notebook, but this seems odd or may be from another nest, as chicks were never observed in this nest 4/20: pulled flag" +2023,6th_bridge,73,smwh,2023-02-22,4,,incubating,"3/8: one chick wet; 4/27: Flag pulled, dead SMWH nearby" +2023,6th_bridge,73,smwh,2023-03-01,4,,incubating,"3/8: one chick wet; 4/27: Flag pulled, dead SMWH nearby" +2023,6th_bridge,73,smwh,2023-03-08,1,3,wet_chick,"3/8: one chick wet; 4/27: Flag pulled, dead SMWH nearby" +2023,6th_bridge,73,smwh,2023-03-14,,3,nestling,"3/8: one chick wet; 4/27: Flag pulled, dead SMWH nearby" +2023,6th_bridge,73,smwh,2023-03-21,,3,nestling,"3/8: one chick wet; 4/27: Flag pulled, dead SMWH nearby" +2023,6th_bridge,73,smwh,2023-03-28,,2,nestling,"3/8: one chick wet; 4/27: Flag pulled, dead SMWH nearby" +2023,6th_bridge,73,smwh,2023-04-04,,,empty,"3/8: one chick wet; 4/27: Flag pulled, dead SMWH nearby" +2023,6th_bridge,73,smwh,2023-04-15,,,empty,"3/8: one chick wet; 4/27: Flag pulled, dead SMWH nearby" +2023,6th_bridge,73,smwh,2023-04-20,,,missed,"3/8: one chick wet; 4/27: Flag pulled, dead SMWH nearby" +2023,6th_bridge,73,smwh,2023-04-27,,,empty,"3/8: one chick wet; 4/27: Flag pulled, dead SMWH nearby" +2023,6th_bridge,73,smwh,2023-05-03,,,,"3/8: one chick wet; 4/27: Flag pulled, dead SMWH nearby" +2023,6th_bridge,106,smwh,2023-02-22,3,,incubating,"3/14: egg pipping" +2023,6th_bridge,106,smwh,2023-03-01,3,,incubating,"3/14: egg pipping" +2023,6th_bridge,106,smwh,2023-03-08,3,,incubating,"3/14: egg pipping" +2023,6th_bridge,106,smwh,2023-03-14,1,1,wet_chick,"3/14: egg pipping" +2023,6th_bridge,106,smwh,2023-03-21,,2,nestling,"3/14: egg pipping" +2023,6th_bridge,106,smwh,2023-03-28,,,empty,"3/14: egg pipping" +2023,6th_bridge,106,smwh,2023-04-04,,,,"3/14: egg pipping" +2023,6th_bridge,106,smwh,2023-04-15,,,,"3/14: egg pipping" +2023,6th_bridge,106,smwh,2023-04-20,,,,"3/14: egg pipping" +2023,6th_bridge,106,smwh,2023-04-27,,,,"3/14: egg pipping" +2023,6th_bridge,106,smwh,2023-05-03,,,,"3/14: egg pipping" +2023,6th_bridge,*106,glib,2023-02-22,,,,"4/4: GLIB takeover 4/20: 1 broken egg in nest" +2023,6th_bridge,*106,glib,2023-03-01,,,,"4/4: GLIB takeover 4/20: 1 broken egg in nest" +2023,6th_bridge,*106,glib,2023-03-08,,,,"4/4: GLIB takeover 4/20: 1 broken egg in nest" +2023,6th_bridge,*106,glib,2023-03-14,,,,"4/4: GLIB takeover 4/20: 1 broken egg in nest" +2023,6th_bridge,*106,glib,2023-03-21,,,,"4/4: GLIB takeover 4/20: 1 broken egg in nest" +2023,6th_bridge,*106,glib,2023-03-28,,,,"4/4: GLIB takeover 4/20: 1 broken egg in nest" +2023,6th_bridge,*106,glib,2023-04-04,1,,incubating,"4/4: GLIB takeover 4/20: 1 broken egg in nest" +2023,6th_bridge,*106,glib,2023-04-15,3,,incubating,"4/4: GLIB takeover 4/20: 1 broken egg in nest" +2023,6th_bridge,*106,glib,2023-04-20,,,empty,"4/4: GLIB takeover 4/20: 1 broken egg in nest" +2023,6th_bridge,*106,glib,2023-04-27,,,missed,"4/4: GLIB takeover 4/20: 1 broken egg in nest" +2023,6th_bridge,*106,glib,2023-05-03,,,missed,"4/4: GLIB takeover 4/20: 1 broken egg in nest" +2023,6th_bridge,75,sneg,2023-02-22,3,,incubating,"Off to the right 3/21: could be 3rd branchling, but couldn't confirm. SNEG adult landed with chicks 4/20: pulled flag" +2023,6th_bridge,75,sneg,2023-03-01,3,,incubating,"Off to the right 3/21: could be 3rd branchling, but couldn't confirm. SNEG adult landed with chicks 4/20: pulled flag" +2023,6th_bridge,75,sneg,2023-03-08,1,2,hatching,"Off to the right 3/21: could be 3rd branchling, but couldn't confirm. SNEG adult landed with chicks 4/20: pulled flag" +2023,6th_bridge,75,sneg,2023-03-14,,3,nestling,"Off to the right 3/21: could be 3rd branchling, but couldn't confirm. SNEG adult landed with chicks 4/20: pulled flag" +2023,6th_bridge,75,sneg,2023-03-21,,2,nestling,"Off to the right 3/21: could be 3rd branchling, but couldn't confirm. SNEG adult landed with chicks 4/20: pulled flag" +2023,6th_bridge,75,sneg,2023-03-28,,1,nestling,"Off to the right 3/21: could be 3rd branchling, but couldn't confirm. SNEG adult landed with chicks 4/20: pulled flag" +2023,6th_bridge,75,sneg,2023-04-04,,,empty,"Off to the right 3/21: could be 3rd branchling, but couldn't confirm. SNEG adult landed with chicks 4/20: pulled flag" +2023,6th_bridge,75,sneg,2023-04-15,,,empty,"Off to the right 3/21: could be 3rd branchling, but couldn't confirm. SNEG adult landed with chicks 4/20: pulled flag" +2023,6th_bridge,75,sneg,2023-04-20,,,pulled,"Off to the right 3/21: could be 3rd branchling, but couldn't confirm. SNEG adult landed with chicks 4/20: pulled flag" +2023,6th_bridge,75,sneg,2023-04-27,,,,"Off to the right 3/21: could be 3rd branchling, but couldn't confirm. SNEG adult landed with chicks 4/20: pulled flag" +2023,6th_bridge,75,sneg,2023-05-03,,,,"Off to the right 3/21: could be 3rd branchling, but couldn't confirm. SNEG adult landed with chicks 4/20: pulled flag" +2023,6th_bridge,108,greg,2023-02-22,3,,incubating,"3/8: chick dry 3/14: 2 chicks certain, with fish in nest 4/4: 1 chick dead in nest; 4/27: Pink paper, branch the nest is on appears to have collapsed" +2023,6th_bridge,108,greg,2023-03-01,3,,incubating,"3/8: chick dry 3/14: 2 chicks certain, with fish in nest 4/4: 1 chick dead in nest; 4/27: Pink paper, branch the nest is on appears to have collapsed" +2023,6th_bridge,108,greg,2023-03-08,1,2,chick_dry,"3/8: chick dry 3/14: 2 chicks certain, with fish in nest 4/4: 1 chick dead in nest; 4/27: Pink paper, branch the nest is on appears to have collapsed" +2023,6th_bridge,108,greg,2023-03-14,,2,nestling,"3/8: chick dry 3/14: 2 chicks certain, with fish in nest 4/4: 1 chick dead in nest; 4/27: Pink paper, branch the nest is on appears to have collapsed" +2023,6th_bridge,108,greg,2023-03-21,,2,nestling,"3/8: chick dry 3/14: 2 chicks certain, with fish in nest 4/4: 1 chick dead in nest; 4/27: Pink paper, branch the nest is on appears to have collapsed" +2023,6th_bridge,108,greg,2023-03-28,,2,nestling,"3/8: chick dry 3/14: 2 chicks certain, with fish in nest 4/4: 1 chick dead in nest; 4/27: Pink paper, branch the nest is on appears to have collapsed" +2023,6th_bridge,108,greg,2023-04-04,,1,nestling,"3/8: chick dry 3/14: 2 chicks certain, with fish in nest 4/4: 1 chick dead in nest; 4/27: Pink paper, branch the nest is on appears to have collapsed" +2023,6th_bridge,108,greg,2023-04-15,,,empty,"3/8: chick dry 3/14: 2 chicks certain, with fish in nest 4/4: 1 chick dead in nest; 4/27: Pink paper, branch the nest is on appears to have collapsed" +2023,6th_bridge,108,greg,2023-04-20,,,empty,"3/8: chick dry 3/14: 2 chicks certain, with fish in nest 4/4: 1 chick dead in nest; 4/27: Pink paper, branch the nest is on appears to have collapsed" +2023,6th_bridge,108,greg,2023-04-27,,,empty,"3/8: chick dry 3/14: 2 chicks certain, with fish in nest 4/4: 1 chick dead in nest; 4/27: Pink paper, branch the nest is on appears to have collapsed" +2023,6th_bridge,108,greg,2023-05-03,,,pulled,"3/8: chick dry 3/14: 2 chicks certain, with fish in nest 4/4: 1 chick dead in nest; 4/27: Pink paper, branch the nest is on appears to have collapsed" +2023,6th_bridge,65,smwh,2023-02-22,4,,incubating, +2023,6th_bridge,65,smwh,2023-03-01,4,,incubating, +2023,6th_bridge,65,smwh,2023-03-08,4,,incubating, +2023,6th_bridge,65,smwh,2023-03-14,,4,nestling, +2023,6th_bridge,65,smwh,2023-03-21,,,empty, +2023,6th_bridge,65,smwh,2023-03-28,,,empty, +2023,6th_bridge,65,smwh,2023-04-04,,,, +2023,6th_bridge,65,smwh,2023-04-15,,,, +2023,6th_bridge,65,smwh,2023-04-20,,,, +2023,6th_bridge,65,smwh,2023-04-27,,,, +2023,6th_bridge,65,smwh,2023-05-03,,,, +2023,6th_bridge,*65,glib,2023-02-22,,,,"4/15: 1 egg pipping; 4/27: Flag pulled" +2023,6th_bridge,*65,glib,2023-03-01,,,,"4/15: 1 egg pipping; 4/27: Flag pulled" +2023,6th_bridge,*65,glib,2023-03-08,,,,"4/15: 1 egg pipping; 4/27: Flag pulled" +2023,6th_bridge,*65,glib,2023-03-14,,,,"4/15: 1 egg pipping; 4/27: Flag pulled" +2023,6th_bridge,*65,glib,2023-03-21,,,,"4/15: 1 egg pipping; 4/27: Flag pulled" +2023,6th_bridge,*65,glib,2023-03-28,2,,incubating,"4/15: 1 egg pipping; 4/27: Flag pulled" +2023,6th_bridge,*65,glib,2023-04-04,2,,incubating,"4/15: 1 egg pipping; 4/27: Flag pulled" +2023,6th_bridge,*65,glib,2023-04-15,2,,pipping,"4/15: 1 egg pipping; 4/27: Flag pulled" +2023,6th_bridge,*65,glib,2023-04-20,,2,nestling,"4/15: 1 egg pipping; 4/27: Flag pulled" +2023,6th_bridge,*65,glib,2023-04-27,,,empty,"4/15: 1 egg pipping; 4/27: Flag pulled" +2023,6th_bridge,*65,glib,2023-05-03,,,,"4/15: 1 egg pipping; 4/27: Flag pulled" +2023,6th_bridge,283,smwh,2023-02-22,,,, +2023,6th_bridge,283,smwh,2023-03-01,3,,incubating, +2023,6th_bridge,283,smwh,2023-03-08,3,,incubating, +2023,6th_bridge,283,smwh,2023-03-14,3,,incubating, +2023,6th_bridge,283,smwh,2023-03-21,,3,nestling, +2023,6th_bridge,283,smwh,2023-03-28,,3,nestling, +2023,6th_bridge,283,smwh,2023-04-04,,,empty, +2023,6th_bridge,283,smwh,2023-04-15,,,empty, +2023,6th_bridge,283,smwh,2023-04-20,,,empty, +2023,6th_bridge,283,smwh,2023-04-27,,,pulled, +2023,6th_bridge,283,smwh,2023-05-03,,,, +2023,6th_bridge,77,smwh,2023-02-22,4,,incubating, +2023,6th_bridge,77,smwh,2023-03-01,3,,incubating, +2023,6th_bridge,77,smwh,2023-03-08,3,,incubating, +2023,6th_bridge,77,smwh,2023-03-14,1,2,chick_dry, +2023,6th_bridge,77,smwh,2023-03-21,,2,nestling, +2023,6th_bridge,77,smwh,2023-03-28,,1,nestling, +2023,6th_bridge,77,smwh,2023-04-04,,,, +2023,6th_bridge,77,smwh,2023-04-15,,,, +2023,6th_bridge,77,smwh,2023-04-20,,,, +2023,6th_bridge,77,smwh,2023-04-27,,,, +2023,6th_bridge,77,smwh,2023-05-03,,,, +2023,6th_bridge,*77,glib,2023-02-22,,,,"4/20: 1 broken egg in nest, pulled flag" +2023,6th_bridge,*77,glib,2023-03-01,,,,"4/20: 1 broken egg in nest, pulled flag" +2023,6th_bridge,*77,glib,2023-03-08,,,,"4/20: 1 broken egg in nest, pulled flag" +2023,6th_bridge,*77,glib,2023-03-14,,,,"4/20: 1 broken egg in nest, pulled flag" +2023,6th_bridge,*77,glib,2023-03-21,,,,"4/20: 1 broken egg in nest, pulled flag" +2023,6th_bridge,*77,glib,2023-03-28,,,,"4/20: 1 broken egg in nest, pulled flag" +2023,6th_bridge,*77,glib,2023-04-04,1,,incubating,"4/20: 1 broken egg in nest, pulled flag" +2023,6th_bridge,*77,glib,2023-04-15,3,,incubating,"4/20: 1 broken egg in nest, pulled flag" +2023,6th_bridge,*77,glib,2023-04-20,,,empty,"4/20: 1 broken egg in nest, pulled flag" +2023,6th_bridge,*77,glib,2023-04-27,,,,"4/20: 1 broken egg in nest, pulled flag" +2023,6th_bridge,*77,glib,2023-05-03,,,,"4/20: 1 broken egg in nest, pulled flag" +2023,6th_bridge,79,greg,2023-02-22,3,,incubating,"3/14: near new nest, being built 4/15: sampled for mercury 4/20: 1 dead chick below nest; 4/27: branchling above, 2 dead chicks below; 5/3: flag pulled" +2023,6th_bridge,79,greg,2023-03-01,3,,incubating,"3/14: near new nest, being built 4/15: sampled for mercury 4/20: 1 dead chick below nest; 4/27: branchling above, 2 dead chicks below; 5/3: flag pulled" +2023,6th_bridge,79,greg,2023-03-08,3,,incubating,"3/14: near new nest, being built 4/15: sampled for mercury 4/20: 1 dead chick below nest; 4/27: branchling above, 2 dead chicks below; 5/3: flag pulled" +2023,6th_bridge,79,greg,2023-03-14,3,,incubating,"3/14: near new nest, being built 4/15: sampled for mercury 4/20: 1 dead chick below nest; 4/27: branchling above, 2 dead chicks below; 5/3: flag pulled" +2023,6th_bridge,79,greg,2023-03-21,,3,nestling,"3/14: near new nest, being built 4/15: sampled for mercury 4/20: 1 dead chick below nest; 4/27: branchling above, 2 dead chicks below; 5/3: flag pulled" +2023,6th_bridge,79,greg,2023-03-28,,3,nestling,"3/14: near new nest, being built 4/15: sampled for mercury 4/20: 1 dead chick below nest; 4/27: branchling above, 2 dead chicks below; 5/3: flag pulled" +2023,6th_bridge,79,greg,2023-04-04,,,missed,"3/14: near new nest, being built 4/15: sampled for mercury 4/20: 1 dead chick below nest; 4/27: branchling above, 2 dead chicks below; 5/3: flag pulled" +2023,6th_bridge,79,greg,2023-04-15,,2,nestling,"3/14: near new nest, being built 4/15: sampled for mercury 4/20: 1 dead chick below nest; 4/27: branchling above, 2 dead chicks below; 5/3: flag pulled" +2023,6th_bridge,79,greg,2023-04-20,,1,branchling,"3/14: near new nest, being built 4/15: sampled for mercury 4/20: 1 dead chick below nest; 4/27: branchling above, 2 dead chicks below; 5/3: flag pulled" +2023,6th_bridge,79,greg,2023-04-27,,1,branchling,"3/14: near new nest, being built 4/15: sampled for mercury 4/20: 1 dead chick below nest; 4/27: branchling above, 2 dead chicks below; 5/3: flag pulled" +2023,6th_bridge,79,greg,2023-05-03,,1,branchling,"3/14: near new nest, being built 4/15: sampled for mercury 4/20: 1 dead chick below nest; 4/27: branchling above, 2 dead chicks below; 5/3: flag pulled" +2023,6th_bridge,285,smwh,2023-02-22,,,, +2023,6th_bridge,285,smwh,2023-03-01,1,,incubating, +2023,6th_bridge,285,smwh,2023-03-08,4,,incubating, +2023,6th_bridge,285,smwh,2023-03-14,4,,incubating, +2023,6th_bridge,285,smwh,2023-03-21,4,,incubating, +2023,6th_bridge,285,smwh,2023-03-28,,2,wet_chick, +2023,6th_bridge,285,smwh,2023-04-04,,,empty, +2023,6th_bridge,285,smwh,2023-04-15,,,empty, +2023,6th_bridge,285,smwh,2023-04-20,,,empty, +2023,6th_bridge,285,smwh,2023-04-27,,,pulled, +2023,6th_bridge,285,smwh,2023-05-03,,,, +2023,6th_bridge,81,greg,2023-02-22,2,,incubating, +2023,6th_bridge,81,greg,2023-03-01,,,empty, +2023,6th_bridge,81,greg,2023-03-08,,,empty, +2023,6th_bridge,81,greg,2023-03-14,,,, +2023,6th_bridge,81,greg,2023-03-21,,,, +2023,6th_bridge,81,greg,2023-03-28,,,, +2023,6th_bridge,81,greg,2023-04-04,,,, +2023,6th_bridge,81,greg,2023-04-15,,,, +2023,6th_bridge,81,greg,2023-04-20,,,, +2023,6th_bridge,81,greg,2023-04-27,,,, +2023,6th_bridge,81,greg,2023-05-03,,,, +2023,6th_bridge,*81,trhe,2023-02-22,,,,"3/21: eggs look small 4/15: 1 chick plus 4/20: species written in as BCNH at one point, but now confirmed TRHE; 4/27: Flag pulled" +2023,6th_bridge,*81,trhe,2023-03-01,,,,"3/21: eggs look small 4/15: 1 chick plus 4/20: species written in as BCNH at one point, but now confirmed TRHE; 4/27: Flag pulled" +2023,6th_bridge,*81,trhe,2023-03-08,,,,"3/21: eggs look small 4/15: 1 chick plus 4/20: species written in as BCNH at one point, but now confirmed TRHE; 4/27: Flag pulled" +2023,6th_bridge,*81,trhe,2023-03-14,3,,incubating,"3/21: eggs look small 4/15: 1 chick plus 4/20: species written in as BCNH at one point, but now confirmed TRHE; 4/27: Flag pulled" +2023,6th_bridge,*81,trhe,2023-03-21,3,,incubating,"3/21: eggs look small 4/15: 1 chick plus 4/20: species written in as BCNH at one point, but now confirmed TRHE; 4/27: Flag pulled" +2023,6th_bridge,*81,trhe,2023-03-28,3,,incubating,"3/21: eggs look small 4/15: 1 chick plus 4/20: species written in as BCNH at one point, but now confirmed TRHE; 4/27: Flag pulled" +2023,6th_bridge,*81,trhe,2023-04-04,1,2,chick_dry,"3/21: eggs look small 4/15: 1 chick plus 4/20: species written in as BCNH at one point, but now confirmed TRHE; 4/27: Flag pulled" +2023,6th_bridge,*81,trhe,2023-04-15,,1,nestling,"3/21: eggs look small 4/15: 1 chick plus 4/20: species written in as BCNH at one point, but now confirmed TRHE; 4/27: Flag pulled" +2023,6th_bridge,*81,trhe,2023-04-20,,2,branchling,"3/21: eggs look small 4/15: 1 chick plus 4/20: species written in as BCNH at one point, but now confirmed TRHE; 4/27: Flag pulled" +2023,6th_bridge,*81,trhe,2023-04-27,,,empty,"3/21: eggs look small 4/15: 1 chick plus 4/20: species written in as BCNH at one point, but now confirmed TRHE; 4/27: Flag pulled" +2023,6th_bridge,*81,trhe,2023-05-03,,,,"3/21: eggs look small 4/15: 1 chick plus 4/20: species written in as BCNH at one point, but now confirmed TRHE; 4/27: Flag pulled" +2023,6th_bridge,67,smwh,2023-02-22,1,,incubating,"3/28: dead egg still in nest" +2023,6th_bridge,67,smwh,2023-03-01,4,,incubating,"3/28: dead egg still in nest" +2023,6th_bridge,67,smwh,2023-03-08,4,,incubating,"3/28: dead egg still in nest" +2023,6th_bridge,67,smwh,2023-03-14,4,,incubating,"3/28: dead egg still in nest" +2023,6th_bridge,67,smwh,2023-03-21,1,2,chick_dry,"3/28: dead egg still in nest" +2023,6th_bridge,67,smwh,2023-03-28,,,empty,"3/28: dead egg still in nest" +2023,6th_bridge,67,smwh,2023-04-04,,,empty,"3/28: dead egg still in nest" +2023,6th_bridge,67,smwh,2023-04-15,,,,"3/28: dead egg still in nest" +2023,6th_bridge,67,smwh,2023-04-20,,,,"3/28: dead egg still in nest" +2023,6th_bridge,67,smwh,2023-04-27,,,,"3/28: dead egg still in nest" +2023,6th_bridge,67,smwh,2023-05-03,,,,"3/28: dead egg still in nest" +2023,6th_bridge,*67,glib,2023-02-22,,,,"4/20: pulled flag" +2023,6th_bridge,*67,glib,2023-03-01,,,,"4/20: pulled flag" +2023,6th_bridge,*67,glib,2023-03-08,,,,"4/20: pulled flag" +2023,6th_bridge,*67,glib,2023-03-14,,,,"4/20: pulled flag" +2023,6th_bridge,*67,glib,2023-03-21,,,,"4/20: pulled flag" +2023,6th_bridge,*67,glib,2023-03-28,,,,"4/20: pulled flag" +2023,6th_bridge,*67,glib,2023-04-04,,,,"4/20: pulled flag" +2023,6th_bridge,*67,glib,2023-04-15,3,,incubating,"4/20: pulled flag" +2023,6th_bridge,*67,glib,2023-04-20,,,empty,"4/20: pulled flag" +2023,6th_bridge,*67,glib,2023-04-27,,,,"4/20: pulled flag" +2023,6th_bridge,*67,glib,2023-05-03,,,,"4/20: pulled flag" +2023,6th_bridge,271,smwh,2023-02-22,,,, +2023,6th_bridge,271,smwh,2023-03-01,2,,incubating, +2023,6th_bridge,271,smwh,2023-03-08,3,,incubating, +2023,6th_bridge,271,smwh,2023-03-14,2,,incubating, +2023,6th_bridge,271,smwh,2023-03-21,2,,incubating, +2023,6th_bridge,271,smwh,2023-03-28,,2,nestling, +2023,6th_bridge,271,smwh,2023-04-04,,,empty, +2023,6th_bridge,271,smwh,2023-04-15,,,empty, +2023,6th_bridge,271,smwh,2023-04-20,,,empty, +2023,6th_bridge,271,smwh,2023-04-27,,,pulled, +2023,6th_bridge,271,smwh,2023-05-03,,,, +2023,6th_bridge,273,smwh,2023-02-22,,,,"3/21: dead chick in nest" +2023,6th_bridge,273,smwh,2023-03-01,4,,incubating,"3/21: dead chick in nest" +2023,6th_bridge,273,smwh,2023-03-08,4,,incubating,"3/21: dead chick in nest" +2023,6th_bridge,273,smwh,2023-03-14,,4,nestling,"3/21: dead chick in nest" +2023,6th_bridge,273,smwh,2023-03-21,,,empty,"3/21: dead chick in nest" +2023,6th_bridge,273,smwh,2023-03-28,,,empty,"3/21: dead chick in nest" +2023,6th_bridge,273,smwh,2023-04-04,,,,"3/21: dead chick in nest" +2023,6th_bridge,273,smwh,2023-04-15,,,,"3/21: dead chick in nest" +2023,6th_bridge,273,smwh,2023-04-20,,,,"3/21: dead chick in nest" +2023,6th_bridge,273,smwh,2023-04-27,,,,"3/21: dead chick in nest" +2023,6th_bridge,273,smwh,2023-05-03,,,,"3/21: dead chick in nest" +2023,6th_bridge,*273,glib,2023-02-22,,,,"4/20: pulled flag" +2023,6th_bridge,*273,glib,2023-03-01,,,,"4/20: pulled flag" +2023,6th_bridge,*273,glib,2023-03-08,,,,"4/20: pulled flag" +2023,6th_bridge,*273,glib,2023-03-14,,,,"4/20: pulled flag" +2023,6th_bridge,*273,glib,2023-03-21,,,,"4/20: pulled flag" +2023,6th_bridge,*273,glib,2023-03-28,2,,incubating,"4/20: pulled flag" +2023,6th_bridge,*273,glib,2023-04-04,,,empty,"4/20: pulled flag" +2023,6th_bridge,*273,glib,2023-04-15,,,empty,"4/20: pulled flag" +2023,6th_bridge,*273,glib,2023-04-20,,,empty,"4/20: pulled flag" +2023,6th_bridge,*273,glib,2023-04-27,,,,"4/20: pulled flag" +2023,6th_bridge,*273,glib,2023-05-03,,,,"4/20: pulled flag" +2023,6th_bridge,83,bcnh,2023-02-22,3,,incubating,"2/22: big E 3/8: don't see 3rd egg in nest 3/28: 1C+" +2023,6th_bridge,83,bcnh,2023-03-01,1,2,hatching,"2/22: big E 3/8: don't see 3rd egg in nest 3/28: 1C+" +2023,6th_bridge,83,bcnh,2023-03-08,,2,nestling,"2/22: big E 3/8: don't see 3rd egg in nest 3/28: 1C+" +2023,6th_bridge,83,bcnh,2023-03-14,,2,nestling,"2/22: big E 3/8: don't see 3rd egg in nest 3/28: 1C+" +2023,6th_bridge,83,bcnh,2023-03-21,,2,nestling,"2/22: big E 3/8: don't see 3rd egg in nest 3/28: 1C+" +2023,6th_bridge,83,bcnh,2023-03-28,,1,branchling,"2/22: big E 3/8: don't see 3rd egg in nest 3/28: 1C+" +2023,6th_bridge,83,bcnh,2023-04-04,,,empty,"2/22: big E 3/8: don't see 3rd egg in nest 3/28: 1C+" +2023,6th_bridge,83,bcnh,2023-04-15,,,empty,"2/22: big E 3/8: don't see 3rd egg in nest 3/28: 1C+" +2023,6th_bridge,83,bcnh,2023-04-20,,,empty,"2/22: big E 3/8: don't see 3rd egg in nest 3/28: 1C+" +2023,6th_bridge,83,bcnh,2023-04-27,,,pulled,"2/22: big E 3/8: don't see 3rd egg in nest 3/28: 1C+" +2023,6th_bridge,83,bcnh,2023-05-03,,,,"2/22: big E 3/8: don't see 3rd egg in nest 3/28: 1C+" +2023,6th_bridge,95,smwh,2023-02-22,3,,incubating,"3/14: chicks dry 4/4: chicks in tree; 4/27: Flag pulled" +2023,6th_bridge,95,smwh,2023-03-01,2,,incubating,"3/14: chicks dry 4/4: chicks in tree; 4/27: Flag pulled" +2023,6th_bridge,95,smwh,2023-03-08,2,,incubating,"3/14: chicks dry 4/4: chicks in tree; 4/27: Flag pulled" +2023,6th_bridge,95,smwh,2023-03-14,,2,chick_dry,"3/14: chicks dry 4/4: chicks in tree; 4/27: Flag pulled" +2023,6th_bridge,95,smwh,2023-03-21,,2,nestling,"3/14: chicks dry 4/4: chicks in tree; 4/27: Flag pulled" +2023,6th_bridge,95,smwh,2023-03-28,,2,nestling,"3/14: chicks dry 4/4: chicks in tree; 4/27: Flag pulled" +2023,6th_bridge,95,smwh,2023-04-04,,2,nestling,"3/14: chicks dry 4/4: chicks in tree; 4/27: Flag pulled" +2023,6th_bridge,95,smwh,2023-04-15,,,missed,"3/14: chicks dry 4/4: chicks in tree; 4/27: Flag pulled" +2023,6th_bridge,95,smwh,2023-04-20,,,missed,"3/14: chicks dry 4/4: chicks in tree; 4/27: Flag pulled" +2023,6th_bridge,95,smwh,2023-04-27,,,empty,"3/14: chicks dry 4/4: chicks in tree; 4/27: Flag pulled" +2023,6th_bridge,95,smwh,2023-05-03,,,,"3/14: chicks dry 4/4: chicks in tree; 4/27: Flag pulled" +2023,6th_bridge,85,smwh,2023-02-22,3,,incubating,"4/15: dead SNEG chick in nest" +2023,6th_bridge,85,smwh,2023-03-01,3,,incubating,"4/15: dead SNEG chick in nest" +2023,6th_bridge,85,smwh,2023-03-08,3,,incubating,"4/15: dead SNEG chick in nest" +2023,6th_bridge,85,smwh,2023-03-14,,3,chick_dry,"4/15: dead SNEG chick in nest" +2023,6th_bridge,85,smwh,2023-03-21,,3,nestling,"4/15: dead SNEG chick in nest" +2023,6th_bridge,85,smwh,2023-03-28,,,empty,"4/15: dead SNEG chick in nest" +2023,6th_bridge,85,smwh,2023-04-04,,,empty,"4/15: dead SNEG chick in nest" +2023,6th_bridge,85,smwh,2023-04-15,,,empty,"4/15: dead SNEG chick in nest" +2023,6th_bridge,85,smwh,2023-04-20,,,empty,"4/15: dead SNEG chick in nest" +2023,6th_bridge,85,smwh,2023-04-27,,,pulled,"4/15: dead SNEG chick in nest" +2023,6th_bridge,85,smwh,2023-05-03,,,,"4/15: dead SNEG chick in nest" +2023,6th_bridge,110,smwh,2023-02-22,2,,incubating, +2023,6th_bridge,110,smwh,2023-03-01,2,,incubating, +2023,6th_bridge,110,smwh,2023-03-08,2,,incubating, +2023,6th_bridge,110,smwh,2023-03-14,,2,nestling, +2023,6th_bridge,110,smwh,2023-03-21,,2,nestling, +2023,6th_bridge,110,smwh,2023-03-28,,,empty, +2023,6th_bridge,110,smwh,2023-04-04,,,, +2023,6th_bridge,110,smwh,2023-04-15,,,, +2023,6th_bridge,110,smwh,2023-04-20,,,, +2023,6th_bridge,110,smwh,2023-04-27,,,, +2023,6th_bridge,110,smwh,2023-05-03,,,, +2023,6th_bridge,*110,glib,2023-02-22,,,,"4/20: eggshells in nest, pulled flag" +2023,6th_bridge,*110,glib,2023-03-01,,,,"4/20: eggshells in nest, pulled flag" +2023,6th_bridge,*110,glib,2023-03-08,,,,"4/20: eggshells in nest, pulled flag" +2023,6th_bridge,*110,glib,2023-03-14,,,,"4/20: eggshells in nest, pulled flag" +2023,6th_bridge,*110,glib,2023-03-21,,,,"4/20: eggshells in nest, pulled flag" +2023,6th_bridge,*110,glib,2023-03-28,,,,"4/20: eggshells in nest, pulled flag" +2023,6th_bridge,*110,glib,2023-04-04,1,,incubating,"4/20: eggshells in nest, pulled flag" +2023,6th_bridge,*110,glib,2023-04-15,2,,incubating,"4/20: eggshells in nest, pulled flag" +2023,6th_bridge,*110,glib,2023-04-20,,,empty,"4/20: eggshells in nest, pulled flag" +2023,6th_bridge,*110,glib,2023-04-27,,,,"4/20: eggshells in nest, pulled flag" +2023,6th_bridge,*110,glib,2023-05-03,,,,"4/20: eggshells in nest, pulled flag" +2023,6th_bridge,87,greg,2023-02-22,2,,incubating,"4/4: sampled bigger chick for mercury 4/15: 2 big chicks running around farther back from nest area 4/20: 1 big chick running around in general area; 4/27: big GREG chick nearby" +2023,6th_bridge,87,greg,2023-03-01,2,,incubating,"4/4: sampled bigger chick for mercury 4/15: 2 big chicks running around farther back from nest area 4/20: 1 big chick running around in general area; 4/27: big GREG chick nearby" +2023,6th_bridge,87,greg,2023-03-08,2,,incubating,"4/4: sampled bigger chick for mercury 4/15: 2 big chicks running around farther back from nest area 4/20: 1 big chick running around in general area; 4/27: big GREG chick nearby" +2023,6th_bridge,87,greg,2023-03-14,,2,nestling,"4/4: sampled bigger chick for mercury 4/15: 2 big chicks running around farther back from nest area 4/20: 1 big chick running around in general area; 4/27: big GREG chick nearby" +2023,6th_bridge,87,greg,2023-03-21,,2,nestling,"4/4: sampled bigger chick for mercury 4/15: 2 big chicks running around farther back from nest area 4/20: 1 big chick running around in general area; 4/27: big GREG chick nearby" +2023,6th_bridge,87,greg,2023-03-28,,2,nestling,"4/4: sampled bigger chick for mercury 4/15: 2 big chicks running around farther back from nest area 4/20: 1 big chick running around in general area; 4/27: big GREG chick nearby" +2023,6th_bridge,87,greg,2023-04-04,,2,nestling,"4/4: sampled bigger chick for mercury 4/15: 2 big chicks running around farther back from nest area 4/20: 1 big chick running around in general area; 4/27: big GREG chick nearby" +2023,6th_bridge,87,greg,2023-04-15,,,empty,"4/4: sampled bigger chick for mercury 4/15: 2 big chicks running around farther back from nest area 4/20: 1 big chick running around in general area; 4/27: big GREG chick nearby" +2023,6th_bridge,87,greg,2023-04-20,,,empty,"4/4: sampled bigger chick for mercury 4/15: 2 big chicks running around farther back from nest area 4/20: 1 big chick running around in general area; 4/27: big GREG chick nearby" +2023,6th_bridge,87,greg,2023-04-27,,,empty,"4/4: sampled bigger chick for mercury 4/15: 2 big chicks running around farther back from nest area 4/20: 1 big chick running around in general area; 4/27: big GREG chick nearby" +2023,6th_bridge,87,greg,2023-05-03,,,,"4/4: sampled bigger chick for mercury 4/15: 2 big chicks running around farther back from nest area 4/20: 1 big chick running around in general area; 4/27: big GREG chick nearby" +2023,6th_bridge,112,smhe,2023-02-22,2,,incubating,"3/21: eggs on the ground" +2023,6th_bridge,112,smhe,2023-03-01,3,,incubating,"3/21: eggs on the ground" +2023,6th_bridge,112,smhe,2023-03-08,3,,incubating,"3/21: eggs on the ground" +2023,6th_bridge,112,smhe,2023-03-14,3,,incubating,"3/21: eggs on the ground" +2023,6th_bridge,112,smhe,2023-03-21,,,empty,"3/21: eggs on the ground" +2023,6th_bridge,112,smhe,2023-03-28,,,empty,"3/21: eggs on the ground" +2023,6th_bridge,112,smhe,2023-04-04,,,,"3/21: eggs on the ground" +2023,6th_bridge,112,smhe,2023-04-15,,,,"3/21: eggs on the ground" +2023,6th_bridge,112,smhe,2023-04-20,,,,"3/21: eggs on the ground" +2023,6th_bridge,112,smhe,2023-04-27,,,,"3/21: eggs on the ground" +2023,6th_bridge,112,smhe,2023-05-03,,,,"3/21: eggs on the ground" +2023,6th_bridge,*112,glib,2023-02-22,,,,"4/15: both chicks dry; 4/27: Flag pulled" +2023,6th_bridge,*112,glib,2023-03-01,,,,"4/15: both chicks dry; 4/27: Flag pulled" +2023,6th_bridge,*112,glib,2023-03-08,,,,"4/15: both chicks dry; 4/27: Flag pulled" +2023,6th_bridge,*112,glib,2023-03-14,,,,"4/15: both chicks dry; 4/27: Flag pulled" +2023,6th_bridge,*112,glib,2023-03-21,,,,"4/15: both chicks dry; 4/27: Flag pulled" +2023,6th_bridge,*112,glib,2023-03-28,3,,incubating,"4/15: both chicks dry; 4/27: Flag pulled" +2023,6th_bridge,*112,glib,2023-04-04,3,,incubating,"4/15: both chicks dry; 4/27: Flag pulled" +2023,6th_bridge,*112,glib,2023-04-15,,2,chick_dry,"4/15: both chicks dry; 4/27: Flag pulled" +2023,6th_bridge,*112,glib,2023-04-20,,2,nestling,"4/15: both chicks dry; 4/27: Flag pulled" +2023,6th_bridge,*112,glib,2023-04-27,,,empty,"4/15: both chicks dry; 4/27: Flag pulled" +2023,6th_bridge,*112,glib,2023-05-03,,,,"4/15: both chicks dry; 4/27: Flag pulled" +2023,6th_bridge,275,smwh,2023-02-22,,,,"3/1: eggs tiny 3/8: chick wet, egg pipping 3/21: nest material on the ground, no sign of chicks" +2023,6th_bridge,275,smwh,2023-03-01,3,,incubating,"3/1: eggs tiny 3/8: chick wet, egg pipping 3/21: nest material on the ground, no sign of chicks" +2023,6th_bridge,275,smwh,2023-03-08,1,2,wet_chick,"3/1: eggs tiny 3/8: chick wet, egg pipping 3/21: nest material on the ground, no sign of chicks" +2023,6th_bridge,275,smwh,2023-03-14,,3,nestling,"3/1: eggs tiny 3/8: chick wet, egg pipping 3/21: nest material on the ground, no sign of chicks" +2023,6th_bridge,275,smwh,2023-03-21,,,empty,"3/1: eggs tiny 3/8: chick wet, egg pipping 3/21: nest material on the ground, no sign of chicks" +2023,6th_bridge,275,smwh,2023-03-28,,,empty,"3/1: eggs tiny 3/8: chick wet, egg pipping 3/21: nest material on the ground, no sign of chicks" +2023,6th_bridge,275,smwh,2023-04-04,,,,"3/1: eggs tiny 3/8: chick wet, egg pipping 3/21: nest material on the ground, no sign of chicks" +2023,6th_bridge,275,smwh,2023-04-15,,,,"3/1: eggs tiny 3/8: chick wet, egg pipping 3/21: nest material on the ground, no sign of chicks" +2023,6th_bridge,275,smwh,2023-04-20,,,,"3/1: eggs tiny 3/8: chick wet, egg pipping 3/21: nest material on the ground, no sign of chicks" +2023,6th_bridge,275,smwh,2023-04-27,,,,"3/1: eggs tiny 3/8: chick wet, egg pipping 3/21: nest material on the ground, no sign of chicks" +2023,6th_bridge,275,smwh,2023-05-03,,,,"3/1: eggs tiny 3/8: chick wet, egg pipping 3/21: nest material on the ground, no sign of chicks" +2023,6th_bridge,*275,glib,2023-02-22,,,,"4/15: both chicks dry 4/20: 2 dead chicks in nest, pulled flag" +2023,6th_bridge,*275,glib,2023-03-01,,,,"4/15: both chicks dry 4/20: 2 dead chicks in nest, pulled flag" +2023,6th_bridge,*275,glib,2023-03-08,,,,"4/15: both chicks dry 4/20: 2 dead chicks in nest, pulled flag" +2023,6th_bridge,*275,glib,2023-03-14,,,,"4/15: both chicks dry 4/20: 2 dead chicks in nest, pulled flag" +2023,6th_bridge,*275,glib,2023-03-21,,,,"4/15: both chicks dry 4/20: 2 dead chicks in nest, pulled flag" +2023,6th_bridge,*275,glib,2023-03-28,3,,incubating,"4/15: both chicks dry 4/20: 2 dead chicks in nest, pulled flag" +2023,6th_bridge,*275,glib,2023-04-04,3,,incubating,"4/15: both chicks dry 4/20: 2 dead chicks in nest, pulled flag" +2023,6th_bridge,*275,glib,2023-04-15,1,2,chick_dry,"4/15: both chicks dry 4/20: 2 dead chicks in nest, pulled flag" +2023,6th_bridge,*275,glib,2023-04-20,,,empty,"4/15: both chicks dry 4/20: 2 dead chicks in nest, pulled flag" +2023,6th_bridge,*275,glib,2023-04-27,,,,"4/15: both chicks dry 4/20: 2 dead chicks in nest, pulled flag" +2023,6th_bridge,*275,glib,2023-05-03,,,,"4/15: both chicks dry 4/20: 2 dead chicks in nest, pulled flag" +2023,6th_bridge,97,smwh,2023-02-22,1,,incubating,"3/21: 1 egg pipping 3/28: egg dead? 4/4: 1 dead egg still in nest, chick in nest appears to be a GREG, 1 SMWH chick seen above nest 4/15: both chicks definitely SMWH" +2023,6th_bridge,97,smwh,2023-03-01,3,,incubating,"3/21: 1 egg pipping 3/28: egg dead? 4/4: 1 dead egg still in nest, chick in nest appears to be a GREG, 1 SMWH chick seen above nest 4/15: both chicks definitely SMWH" +2023,6th_bridge,97,smwh,2023-03-08,3,,incubating,"3/21: 1 egg pipping 3/28: egg dead? 4/4: 1 dead egg still in nest, chick in nest appears to be a GREG, 1 SMWH chick seen above nest 4/15: both chicks definitely SMWH" +2023,6th_bridge,97,smwh,2023-03-14,3,,incubating,"3/21: 1 egg pipping 3/28: egg dead? 4/4: 1 dead egg still in nest, chick in nest appears to be a GREG, 1 SMWH chick seen above nest 4/15: both chicks definitely SMWH" +2023,6th_bridge,97,smwh,2023-03-21,2,1,pipping,"3/21: 1 egg pipping 3/28: egg dead? 4/4: 1 dead egg still in nest, chick in nest appears to be a GREG, 1 SMWH chick seen above nest 4/15: both chicks definitely SMWH" +2023,6th_bridge,97,smwh,2023-03-28,1,2,hatching,"3/21: 1 egg pipping 3/28: egg dead? 4/4: 1 dead egg still in nest, chick in nest appears to be a GREG, 1 SMWH chick seen above nest 4/15: both chicks definitely SMWH" +2023,6th_bridge,97,smwh,2023-04-04,,1,nestling,"3/21: 1 egg pipping 3/28: egg dead? 4/4: 1 dead egg still in nest, chick in nest appears to be a GREG, 1 SMWH chick seen above nest 4/15: both chicks definitely SMWH" +2023,6th_bridge,97,smwh,2023-04-15,,2,nestling,"3/21: 1 egg pipping 3/28: egg dead? 4/4: 1 dead egg still in nest, chick in nest appears to be a GREG, 1 SMWH chick seen above nest 4/15: both chicks definitely SMWH" +2023,6th_bridge,97,smwh,2023-04-20,,,empty,"3/21: 1 egg pipping 3/28: egg dead? 4/4: 1 dead egg still in nest, chick in nest appears to be a GREG, 1 SMWH chick seen above nest 4/15: both chicks definitely SMWH" +2023,6th_bridge,97,smwh,2023-04-27,,,pulled,"3/21: 1 egg pipping 3/28: egg dead? 4/4: 1 dead egg still in nest, chick in nest appears to be a GREG, 1 SMWH chick seen above nest 4/15: both chicks definitely SMWH" +2023,6th_bridge,97,smwh,2023-05-03,,,,"3/21: 1 egg pipping 3/28: egg dead? 4/4: 1 dead egg still in nest, chick in nest appears to be a GREG, 1 SMWH chick seen above nest 4/15: both chicks definitely SMWH" +2023,6th_bridge,99,greg,2023-02-22,2,,incubating,"3/8: one chick a bit damp 4/4: chicks up above nest; 4/27: Orange paper" +2023,6th_bridge,99,greg,2023-03-01,2,,incubating,"3/8: one chick a bit damp 4/4: chicks up above nest; 4/27: Orange paper" +2023,6th_bridge,99,greg,2023-03-08,,2,nestling,"3/8: one chick a bit damp 4/4: chicks up above nest; 4/27: Orange paper" +2023,6th_bridge,99,greg,2023-03-14,,2,nestling,"3/8: one chick a bit damp 4/4: chicks up above nest; 4/27: Orange paper" +2023,6th_bridge,99,greg,2023-03-21,,2,nestling,"3/8: one chick a bit damp 4/4: chicks up above nest; 4/27: Orange paper" +2023,6th_bridge,99,greg,2023-03-28,,,missed,"3/8: one chick a bit damp 4/4: chicks up above nest; 4/27: Orange paper" +2023,6th_bridge,99,greg,2023-04-04,,2,branchling,"3/8: one chick a bit damp 4/4: chicks up above nest; 4/27: Orange paper" +2023,6th_bridge,99,greg,2023-04-15,,,empty,"3/8: one chick a bit damp 4/4: chicks up above nest; 4/27: Orange paper" +2023,6th_bridge,99,greg,2023-04-20,,,empty,"3/8: one chick a bit damp 4/4: chicks up above nest; 4/27: Orange paper" +2023,6th_bridge,99,greg,2023-04-27,,,pulled,"3/8: one chick a bit damp 4/4: chicks up above nest; 4/27: Orange paper" +2023,6th_bridge,99,greg,2023-05-03,,,,"3/8: one chick a bit damp 4/4: chicks up above nest; 4/27: Orange paper" +2023,6th_bridge,240,greg,2023-02-22,,,,"3/8: one chick wet, one chick dry 4/15: sampled for mercury 4/20: dead chick on ground near nest; 4/27 branchling nearby" +2023,6th_bridge,240,greg,2023-03-01,2,,incubating,"3/8: one chick wet, one chick dry 4/15: sampled for mercury 4/20: dead chick on ground near nest; 4/27 branchling nearby" +2023,6th_bridge,240,greg,2023-03-08,,2,wet_chick,"3/8: one chick wet, one chick dry 4/15: sampled for mercury 4/20: dead chick on ground near nest; 4/27 branchling nearby" +2023,6th_bridge,240,greg,2023-03-14,,2,nestling,"3/8: one chick wet, one chick dry 4/15: sampled for mercury 4/20: dead chick on ground near nest; 4/27 branchling nearby" +2023,6th_bridge,240,greg,2023-03-21,,2,nestling,"3/8: one chick wet, one chick dry 4/15: sampled for mercury 4/20: dead chick on ground near nest; 4/27 branchling nearby" +2023,6th_bridge,240,greg,2023-03-28,,2,nestling,"3/8: one chick wet, one chick dry 4/15: sampled for mercury 4/20: dead chick on ground near nest; 4/27 branchling nearby" +2023,6th_bridge,240,greg,2023-04-04,,2,nestling,"3/8: one chick wet, one chick dry 4/15: sampled for mercury 4/20: dead chick on ground near nest; 4/27 branchling nearby" +2023,6th_bridge,240,greg,2023-04-15,,1,nestling,"3/8: one chick wet, one chick dry 4/15: sampled for mercury 4/20: dead chick on ground near nest; 4/27 branchling nearby" +2023,6th_bridge,240,greg,2023-04-20,,,empty,"3/8: one chick wet, one chick dry 4/15: sampled for mercury 4/20: dead chick on ground near nest; 4/27 branchling nearby" +2023,6th_bridge,240,greg,2023-04-27,,,empty,"3/8: one chick wet, one chick dry 4/15: sampled for mercury 4/20: dead chick on ground near nest; 4/27 branchling nearby" +2023,6th_bridge,240,greg,2023-05-03,,,pulled,"3/8: one chick wet, one chick dry 4/15: sampled for mercury 4/20: dead chick on ground near nest; 4/27 branchling nearby" +2023,6th_bridge,89,smhe,2023-02-22,4,,incubating,"3/21: nest gone 3/28: new marked GLIB nest above 4/20: pulled flag" +2023,6th_bridge,89,smhe,2023-03-01,1,,incubating,"3/21: nest gone 3/28: new marked GLIB nest above 4/20: pulled flag" +2023,6th_bridge,89,smhe,2023-03-08,,,empty,"3/21: nest gone 3/28: new marked GLIB nest above 4/20: pulled flag" +2023,6th_bridge,89,smhe,2023-03-14,,,,"3/21: nest gone 3/28: new marked GLIB nest above 4/20: pulled flag" +2023,6th_bridge,89,smhe,2023-03-21,,,,"3/21: nest gone 3/28: new marked GLIB nest above 4/20: pulled flag" +2023,6th_bridge,89,smhe,2023-03-28,,,,"3/21: nest gone 3/28: new marked GLIB nest above 4/20: pulled flag" +2023,6th_bridge,89,smhe,2023-04-04,,,,"3/21: nest gone 3/28: new marked GLIB nest above 4/20: pulled flag" +2023,6th_bridge,89,smhe,2023-04-15,,,,"3/21: nest gone 3/28: new marked GLIB nest above 4/20: pulled flag" +2023,6th_bridge,89,smhe,2023-04-20,,,pulled,"3/21: nest gone 3/28: new marked GLIB nest above 4/20: pulled flag" +2023,6th_bridge,89,smhe,2023-04-27,,,,"3/21: nest gone 3/28: new marked GLIB nest above 4/20: pulled flag" +2023,6th_bridge,89,smhe,2023-05-03,,,,"3/21: nest gone 3/28: new marked GLIB nest above 4/20: pulled flag" +2023,6th_bridge,101,rosp,2023-02-22,2,2,hatching,"2/22 both chicks dry 3/8: biggest 2 chicks starting to climb 3/28: only 1 chick seen, but very large and mobile 4/4: no chicks immediately around nest, nest fully gone, 1 large ROSP chick seen later in general area from a different angle but not sure if it came from this nest; 4/27: Blue paper, nest is gone- paper on branch where nest was originally" +2023,6th_bridge,101,rosp,2023-03-01,,4,nestling,"2/22 both chicks dry 3/8: biggest 2 chicks starting to climb 3/28: only 1 chick seen, but very large and mobile 4/4: no chicks immediately around nest, nest fully gone, 1 large ROSP chick seen later in general area from a different angle but not sure if it came from this nest; 4/27: Blue paper, nest is gone- paper on branch where nest was originally" +2023,6th_bridge,101,rosp,2023-03-08,,4,nestling,"2/22 both chicks dry 3/8: biggest 2 chicks starting to climb 3/28: only 1 chick seen, but very large and mobile 4/4: no chicks immediately around nest, nest fully gone, 1 large ROSP chick seen later in general area from a different angle but not sure if it came from this nest; 4/27: Blue paper, nest is gone- paper on branch where nest was originally" +2023,6th_bridge,101,rosp,2023-03-14,,4,nestling,"2/22 both chicks dry 3/8: biggest 2 chicks starting to climb 3/28: only 1 chick seen, but very large and mobile 4/4: no chicks immediately around nest, nest fully gone, 1 large ROSP chick seen later in general area from a different angle but not sure if it came from this nest; 4/27: Blue paper, nest is gone- paper on branch where nest was originally" +2023,6th_bridge,101,rosp,2023-03-21,,4,nestling,"2/22 both chicks dry 3/8: biggest 2 chicks starting to climb 3/28: only 1 chick seen, but very large and mobile 4/4: no chicks immediately around nest, nest fully gone, 1 large ROSP chick seen later in general area from a different angle but not sure if it came from this nest; 4/27: Blue paper, nest is gone- paper on branch where nest was originally" +2023,6th_bridge,101,rosp,2023-03-28,,1,nestling,"2/22 both chicks dry 3/8: biggest 2 chicks starting to climb 3/28: only 1 chick seen, but very large and mobile 4/4: no chicks immediately around nest, nest fully gone, 1 large ROSP chick seen later in general area from a different angle but not sure if it came from this nest; 4/27: Blue paper, nest is gone- paper on branch where nest was originally" +2023,6th_bridge,101,rosp,2023-04-04,,,empty,"2/22 both chicks dry 3/8: biggest 2 chicks starting to climb 3/28: only 1 chick seen, but very large and mobile 4/4: no chicks immediately around nest, nest fully gone, 1 large ROSP chick seen later in general area from a different angle but not sure if it came from this nest; 4/27: Blue paper, nest is gone- paper on branch where nest was originally" +2023,6th_bridge,101,rosp,2023-04-15,,,,"2/22 both chicks dry 3/8: biggest 2 chicks starting to climb 3/28: only 1 chick seen, but very large and mobile 4/4: no chicks immediately around nest, nest fully gone, 1 large ROSP chick seen later in general area from a different angle but not sure if it came from this nest; 4/27: Blue paper, nest is gone- paper on branch where nest was originally" +2023,6th_bridge,101,rosp,2023-04-20,,,,"2/22 both chicks dry 3/8: biggest 2 chicks starting to climb 3/28: only 1 chick seen, but very large and mobile 4/4: no chicks immediately around nest, nest fully gone, 1 large ROSP chick seen later in general area from a different angle but not sure if it came from this nest; 4/27: Blue paper, nest is gone- paper on branch where nest was originally" +2023,6th_bridge,101,rosp,2023-04-27,,,pulled,"2/22 both chicks dry 3/8: biggest 2 chicks starting to climb 3/28: only 1 chick seen, but very large and mobile 4/4: no chicks immediately around nest, nest fully gone, 1 large ROSP chick seen later in general area from a different angle but not sure if it came from this nest; 4/27: Blue paper, nest is gone- paper on branch where nest was originally" +2023,6th_bridge,101,rosp,2023-05-03,,,,"2/22 both chicks dry 3/8: biggest 2 chicks starting to climb 3/28: only 1 chick seen, but very large and mobile 4/4: no chicks immediately around nest, nest fully gone, 1 large ROSP chick seen later in general area from a different angle but not sure if it came from this nest; 4/27: Blue paper, nest is gone- paper on branch where nest was originally" +2023,6th_bridge,103,smwh,2023-02-22,3,,incubating,"3/21: no sign of former SMWH ocants, taken over by WHIB" +2023,6th_bridge,103,smwh,2023-03-01,4,,incubating,"3/21: no sign of former SMWH ocants, taken over by WHIB" +2023,6th_bridge,103,smwh,2023-03-08,4,,incubating,"3/21: no sign of former SMWH ocants, taken over by WHIB" +2023,6th_bridge,103,smwh,2023-03-14,3,1,hatching,"3/21: no sign of former SMWH ocants, taken over by WHIB" +2023,6th_bridge,103,smwh,2023-03-21,,,empty,"3/21: no sign of former SMWH ocants, taken over by WHIB" +2023,6th_bridge,103,smwh,2023-03-28,,,empty,"3/21: no sign of former SMWH ocants, taken over by WHIB" +2023,6th_bridge,103,smwh,2023-04-04,,,,"3/21: no sign of former SMWH ocants, taken over by WHIB" +2023,6th_bridge,103,smwh,2023-04-15,,,,"3/21: no sign of former SMWH ocants, taken over by WHIB" +2023,6th_bridge,103,smwh,2023-04-20,,,,"3/21: no sign of former SMWH ocants, taken over by WHIB" +2023,6th_bridge,103,smwh,2023-04-27,,,,"3/21: no sign of former SMWH ocants, taken over by WHIB" +2023,6th_bridge,103,smwh,2023-05-03,,,,"3/21: no sign of former SMWH ocants, taken over by WHIB" +2023,6th_bridge,*103,whib,2023-02-22,,,, +2023,6th_bridge,*103,whib,2023-03-01,,,, +2023,6th_bridge,*103,whib,2023-03-08,,,, +2023,6th_bridge,*103,whib,2023-03-14,,,, +2023,6th_bridge,*103,whib,2023-03-21,2,,incubating, +2023,6th_bridge,*103,whib,2023-03-28,2,,incubating, +2023,6th_bridge,*103,whib,2023-04-04,,,empty, +2023,6th_bridge,*103,whib,2023-04-15,,,, +2023,6th_bridge,*103,whib,2023-04-20,,,, +2023,6th_bridge,*103,whib,2023-04-27,,,, +2023,6th_bridge,*103,whib,2023-05-03,,,, +2023,6th_bridge,*103,glib,2023-02-22,,,,"4/15: broken eggs in nest 4/20: pulled flag" +2023,6th_bridge,*103,glib,2023-03-01,,,,"4/15: broken eggs in nest 4/20: pulled flag" +2023,6th_bridge,*103,glib,2023-03-08,,,,"4/15: broken eggs in nest 4/20: pulled flag" +2023,6th_bridge,*103,glib,2023-03-14,,,,"4/15: broken eggs in nest 4/20: pulled flag" +2023,6th_bridge,*103,glib,2023-03-21,,,,"4/15: broken eggs in nest 4/20: pulled flag" +2023,6th_bridge,*103,glib,2023-03-28,,,,"4/15: broken eggs in nest 4/20: pulled flag" +2023,6th_bridge,*103,glib,2023-04-04,1,,incubating,"4/15: broken eggs in nest 4/20: pulled flag" +2023,6th_bridge,*103,glib,2023-04-15,,,empty,"4/15: broken eggs in nest 4/20: pulled flag" +2023,6th_bridge,*103,glib,2023-04-20,,,pulled,"4/15: broken eggs in nest 4/20: pulled flag" +2023,6th_bridge,*103,glib,2023-04-27,,,,"4/15: broken eggs in nest 4/20: pulled flag" +2023,6th_bridge,*103,glib,2023-05-03,,,,"4/15: broken eggs in nest 4/20: pulled flag" +2023,6th_bridge,287,smwh,2023-02-22,,,,"3/28: 2 chicks certain" +2023,6th_bridge,287,smwh,2023-03-01,1,,incubating,"3/28: 2 chicks certain" +2023,6th_bridge,287,smwh,2023-03-08,3,,incubating,"3/28: 2 chicks certain" +2023,6th_bridge,287,smwh,2023-03-14,3,,incubating,"3/28: 2 chicks certain" +2023,6th_bridge,287,smwh,2023-03-21,3,,incubating,"3/28: 2 chicks certain" +2023,6th_bridge,287,smwh,2023-03-28,,2,nestling,"3/28: 2 chicks certain" +2023,6th_bridge,287,smwh,2023-04-04,,,empty,"3/28: 2 chicks certain" +2023,6th_bridge,287,smwh,2023-04-15,,,empty,"3/28: 2 chicks certain" +2023,6th_bridge,287,smwh,2023-04-20,,,empty,"3/28: 2 chicks certain" +2023,6th_bridge,287,smwh,2023-04-27,,,pulled,"3/28: 2 chicks certain" +2023,6th_bridge,287,smwh,2023-05-03,,,,"3/28: 2 chicks certain" +2023,6th_bridge,105,bcnh,2023-02-22,1,,incubating,"2/22: big eggs 3/8: certain 2 eggs; 4/27: Flag pulled" +2023,6th_bridge,105,bcnh,2023-03-01,3,,incubating,"2/22: big eggs 3/8: certain 2 eggs; 4/27: Flag pulled" +2023,6th_bridge,105,bcnh,2023-03-08,2,,incubating,"2/22: big eggs 3/8: certain 2 eggs; 4/27: Flag pulled" +2023,6th_bridge,105,bcnh,2023-03-14,2,,incubating,"2/22: big eggs 3/8: certain 2 eggs; 4/27: Flag pulled" +2023,6th_bridge,105,bcnh,2023-03-21,,2,nestling,"2/22: big eggs 3/8: certain 2 eggs; 4/27: Flag pulled" +2023,6th_bridge,105,bcnh,2023-03-28,,2,nestling,"2/22: big eggs 3/8: certain 2 eggs; 4/27: Flag pulled" +2023,6th_bridge,105,bcnh,2023-04-04,,2,nestling,"2/22: big eggs 3/8: certain 2 eggs; 4/27: Flag pulled" +2023,6th_bridge,105,bcnh,2023-04-15,,,empty,"2/22: big eggs 3/8: certain 2 eggs; 4/27: Flag pulled" +2023,6th_bridge,105,bcnh,2023-04-20,,1,nestling,"2/22: big eggs 3/8: certain 2 eggs; 4/27: Flag pulled" +2023,6th_bridge,105,bcnh,2023-04-27,,,empty,"2/22: big eggs 3/8: certain 2 eggs; 4/27: Flag pulled" +2023,6th_bridge,105,bcnh,2023-05-03,,,,"2/22: big eggs 3/8: certain 2 eggs; 4/27: Flag pulled" +2023,6th_bridge,107,bcnh,2023-02-22,2,,incubating,"2/22: big eggs 4/20: pulled flagging" +2023,6th_bridge,107,bcnh,2023-03-01,3,,incubating,"2/22: big eggs 4/20: pulled flagging" +2023,6th_bridge,107,bcnh,2023-03-08,3,,incubating,"2/22: big eggs 4/20: pulled flagging" +2023,6th_bridge,107,bcnh,2023-03-14,2,1,wet_chick,"2/22: big eggs 4/20: pulled flagging" +2023,6th_bridge,107,bcnh,2023-03-21,,3,nestling,"2/22: big eggs 4/20: pulled flagging" +2023,6th_bridge,107,bcnh,2023-03-28,,3,nestling,"2/22: big eggs 4/20: pulled flagging" +2023,6th_bridge,107,bcnh,2023-04-04,,,missed,"2/22: big eggs 4/20: pulled flagging" +2023,6th_bridge,107,bcnh,2023-04-15,,,empty,"2/22: big eggs 4/20: pulled flagging" +2023,6th_bridge,107,bcnh,2023-04-20,,,pulled,"2/22: big eggs 4/20: pulled flagging" +2023,6th_bridge,107,bcnh,2023-04-27,,,,"2/22: big eggs 4/20: pulled flagging" +2023,6th_bridge,107,bcnh,2023-05-03,,,,"2/22: big eggs 4/20: pulled flagging" +2023,6th_bridge,109,trhe,2023-02-22,1,,incubating,"2/22: big eggs 3/8: double checked, eggs in nest again after previous empty nest 4/15: big chicks, scrambled high up above nest" +2023,6th_bridge,109,trhe,2023-03-01,,,empty,"2/22: big eggs 3/8: double checked, eggs in nest again after previous empty nest 4/15: big chicks, scrambled high up above nest" +2023,6th_bridge,109,trhe,2023-03-08,3,,incubating,"2/22: big eggs 3/8: double checked, eggs in nest again after previous empty nest 4/15: big chicks, scrambled high up above nest" +2023,6th_bridge,109,trhe,2023-03-14,3,,incubating,"2/22: big eggs 3/8: double checked, eggs in nest again after previous empty nest 4/15: big chicks, scrambled high up above nest" +2023,6th_bridge,109,trhe,2023-03-21,3,,incubating,"2/22: big eggs 3/8: double checked, eggs in nest again after previous empty nest 4/15: big chicks, scrambled high up above nest" +2023,6th_bridge,109,trhe,2023-03-28,3,,incubating,"2/22: big eggs 3/8: double checked, eggs in nest again after previous empty nest 4/15: big chicks, scrambled high up above nest" +2023,6th_bridge,109,trhe,2023-04-04,,3,nestling,"2/22: big eggs 3/8: double checked, eggs in nest again after previous empty nest 4/15: big chicks, scrambled high up above nest" +2023,6th_bridge,109,trhe,2023-04-15,,2,nestling,"2/22: big eggs 3/8: double checked, eggs in nest again after previous empty nest 4/15: big chicks, scrambled high up above nest" +2023,6th_bridge,109,trhe,2023-04-20,,,empty,"2/22: big eggs 3/8: double checked, eggs in nest again after previous empty nest 4/15: big chicks, scrambled high up above nest" +2023,6th_bridge,109,trhe,2023-04-27,,,pulled,"2/22: big eggs 3/8: double checked, eggs in nest again after previous empty nest 4/15: big chicks, scrambled high up above nest" +2023,6th_bridge,109,trhe,2023-05-03,,,,"2/22: big eggs 3/8: double checked, eggs in nest again after previous empty nest 4/15: big chicks, scrambled high up above nest" +2023,6th_bridge,111,smwh,2023-02-22,3,,incubating,"4/4: 3 chicks seen between 111 and 113, could not determine which were from which nest" +2023,6th_bridge,111,smwh,2023-03-01,3,,incubating,"4/4: 3 chicks seen between 111 and 113, could not determine which were from which nest" +2023,6th_bridge,111,smwh,2023-03-08,3,,incubating,"4/4: 3 chicks seen between 111 and 113, could not determine which were from which nest" +2023,6th_bridge,111,smwh,2023-03-14,,3,chick_dry,"4/4: 3 chicks seen between 111 and 113, could not determine which were from which nest" +2023,6th_bridge,111,smwh,2023-03-21,,3,nestling,"4/4: 3 chicks seen between 111 and 113, could not determine which were from which nest" +2023,6th_bridge,111,smwh,2023-03-28,,3,nestling,"4/4: 3 chicks seen between 111 and 113, could not determine which were from which nest" +2023,6th_bridge,111,smwh,2023-04-04,,3,nestling,"4/4: 3 chicks seen between 111 and 113, could not determine which were from which nest" +2023,6th_bridge,111,smwh,2023-04-15,,,empty,"4/4: 3 chicks seen between 111 and 113, could not determine which were from which nest" +2023,6th_bridge,111,smwh,2023-04-20,,,missed,"4/4: 3 chicks seen between 111 and 113, could not determine which were from which nest" +2023,6th_bridge,111,smwh,2023-04-27,,,missed,"4/4: 3 chicks seen between 111 and 113, could not determine which were from which nest" +2023,6th_bridge,111,smwh,2023-05-03,,,pulled,"4/4: 3 chicks seen between 111 and 113, could not determine which were from which nest" +2023,6th_bridge,279,sneg,2023-02-22,,,,"3/21: SNEG adult right by nest 4/4: could only confirm 3 chicks but possible there are still 4; 4/27: Flag pulled" +2023,6th_bridge,279,sneg,2023-03-01,4,,incubating,"3/21: SNEG adult right by nest 4/4: could only confirm 3 chicks but possible there are still 4; 4/27: Flag pulled" +2023,6th_bridge,279,sneg,2023-03-08,4,,incubating,"3/21: SNEG adult right by nest 4/4: could only confirm 3 chicks but possible there are still 4; 4/27: Flag pulled" +2023,6th_bridge,279,sneg,2023-03-14,4,,incubating,"3/21: SNEG adult right by nest 4/4: could only confirm 3 chicks but possible there are still 4; 4/27: Flag pulled" +2023,6th_bridge,279,sneg,2023-03-21,1,3,wet_chick,"3/21: SNEG adult right by nest 4/4: could only confirm 3 chicks but possible there are still 4; 4/27: Flag pulled" +2023,6th_bridge,279,sneg,2023-03-28,,4,nestling,"3/21: SNEG adult right by nest 4/4: could only confirm 3 chicks but possible there are still 4; 4/27: Flag pulled" +2023,6th_bridge,279,sneg,2023-04-04,,3,nestling,"3/21: SNEG adult right by nest 4/4: could only confirm 3 chicks but possible there are still 4; 4/27: Flag pulled" +2023,6th_bridge,279,sneg,2023-04-15,,,empty,"3/21: SNEG adult right by nest 4/4: could only confirm 3 chicks but possible there are still 4; 4/27: Flag pulled" +2023,6th_bridge,279,sneg,2023-04-20,,,missed,"3/21: SNEG adult right by nest 4/4: could only confirm 3 chicks but possible there are still 4; 4/27: Flag pulled" +2023,6th_bridge,279,sneg,2023-04-27,,,empty,"3/21: SNEG adult right by nest 4/4: could only confirm 3 chicks but possible there are still 4; 4/27: Flag pulled" +2023,6th_bridge,279,sneg,2023-05-03,,,,"3/21: SNEG adult right by nest 4/4: could only confirm 3 chicks but possible there are still 4; 4/27: Flag pulled" +2023,6th_bridge,114,bcnh,2023-02-22,1,,incubating,"3/28: one dead chick in the nest" +2023,6th_bridge,114,bcnh,2023-03-01,2,,incubating,"3/28: one dead chick in the nest" +2023,6th_bridge,114,bcnh,2023-03-08,2,,incubating,"3/28: one dead chick in the nest" +2023,6th_bridge,114,bcnh,2023-03-14,2,,incubating,"3/28: one dead chick in the nest" +2023,6th_bridge,114,bcnh,2023-03-21,,2,chick_dry,"3/28: one dead chick in the nest" +2023,6th_bridge,114,bcnh,2023-03-28,,,empty,"3/28: one dead chick in the nest" +2023,6th_bridge,114,bcnh,2023-04-04,,,,"3/28: one dead chick in the nest" +2023,6th_bridge,114,bcnh,2023-04-15,,,,"3/28: one dead chick in the nest" +2023,6th_bridge,114,bcnh,2023-04-20,,,,"3/28: one dead chick in the nest" +2023,6th_bridge,114,bcnh,2023-04-27,,,,"3/28: one dead chick in the nest" +2023,6th_bridge,114,bcnh,2023-05-03,,,,"3/28: one dead chick in the nest" +2023,6th_bridge,*114,glib,2023-02-22,,,,"4/20: pulled flag" +2023,6th_bridge,*114,glib,2023-03-01,,,,"4/20: pulled flag" +2023,6th_bridge,*114,glib,2023-03-08,,,,"4/20: pulled flag" +2023,6th_bridge,*114,glib,2023-03-14,,,,"4/20: pulled flag" +2023,6th_bridge,*114,glib,2023-03-21,,,,"4/20: pulled flag" +2023,6th_bridge,*114,glib,2023-03-28,,,,"4/20: pulled flag" +2023,6th_bridge,*114,glib,2023-04-04,1,,incubating,"4/20: pulled flag" +2023,6th_bridge,*114,glib,2023-04-15,,,empty,"4/20: pulled flag" +2023,6th_bridge,*114,glib,2023-04-20,,,pulled,"4/20: pulled flag" +2023,6th_bridge,*114,glib,2023-04-27,,,,"4/20: pulled flag" +2023,6th_bridge,*114,glib,2023-05-03,,,,"4/20: pulled flag" +2023,6th_bridge,91,bcnh,2023-02-22,1,,incubating,"4/20: pulled flag" +2023,6th_bridge,91,bcnh,2023-03-01,3,,incubating,"4/20: pulled flag" +2023,6th_bridge,91,bcnh,2023-03-08,3,,incubating,"4/20: pulled flag" +2023,6th_bridge,91,bcnh,2023-03-14,3,,incubating,"4/20: pulled flag" +2023,6th_bridge,91,bcnh,2023-03-21,,3,nestling,"4/20: pulled flag" +2023,6th_bridge,91,bcnh,2023-03-28,,1,nestling,"4/20: pulled flag" +2023,6th_bridge,91,bcnh,2023-04-04,,1,nestling,"4/20: pulled flag" +2023,6th_bridge,91,bcnh,2023-04-15,,,empty,"4/20: pulled flag" +2023,6th_bridge,91,bcnh,2023-04-20,,,pulled,"4/20: pulled flag" +2023,6th_bridge,91,bcnh,2023-04-27,,,,"4/20: pulled flag" +2023,6th_bridge,91,bcnh,2023-05-03,,,,"4/20: pulled flag" +2023,6th_bridge,113,smwh,2023-02-22,3,,incubating,"3/1 bigger eggs 3/8: SNEG perched nearby 3/28: 2C+ 4/4: 3 chicks seen between 111 and 113, could not determine which were from which nest; 4/27: Flag pulled, collapsed" +2023,6th_bridge,113,smwh,2023-03-01,3,,incubating,"3/1 bigger eggs 3/8: SNEG perched nearby 3/28: 2C+ 4/4: 3 chicks seen between 111 and 113, could not determine which were from which nest; 4/27: Flag pulled, collapsed" +2023,6th_bridge,113,smwh,2023-03-08,1,2,hatching,"3/1 bigger eggs 3/8: SNEG perched nearby 3/28: 2C+ 4/4: 3 chicks seen between 111 and 113, could not determine which were from which nest; 4/27: Flag pulled, collapsed" +2023,6th_bridge,113,smwh,2023-03-14,,3,nestling,"3/1 bigger eggs 3/8: SNEG perched nearby 3/28: 2C+ 4/4: 3 chicks seen between 111 and 113, could not determine which were from which nest; 4/27: Flag pulled, collapsed" +2023,6th_bridge,113,smwh,2023-03-21,,3,nestling,"3/1 bigger eggs 3/8: SNEG perched nearby 3/28: 2C+ 4/4: 3 chicks seen between 111 and 113, could not determine which were from which nest; 4/27: Flag pulled, collapsed" +2023,6th_bridge,113,smwh,2023-03-28,,2,nestling,"3/1 bigger eggs 3/8: SNEG perched nearby 3/28: 2C+ 4/4: 3 chicks seen between 111 and 113, could not determine which were from which nest; 4/27: Flag pulled, collapsed" +2023,6th_bridge,113,smwh,2023-04-04,,,nestling,"3/1 bigger eggs 3/8: SNEG perched nearby 3/28: 2C+ 4/4: 3 chicks seen between 111 and 113, could not determine which were from which nest; 4/27: Flag pulled, collapsed" +2023,6th_bridge,113,smwh,2023-04-15,,,empty,"3/1 bigger eggs 3/8: SNEG perched nearby 3/28: 2C+ 4/4: 3 chicks seen between 111 and 113, could not determine which were from which nest; 4/27: Flag pulled, collapsed" +2023,6th_bridge,113,smwh,2023-04-20,,,missed,"3/1 bigger eggs 3/8: SNEG perched nearby 3/28: 2C+ 4/4: 3 chicks seen between 111 and 113, could not determine which were from which nest; 4/27: Flag pulled, collapsed" +2023,6th_bridge,113,smwh,2023-04-27,,,empty,"3/1 bigger eggs 3/8: SNEG perched nearby 3/28: 2C+ 4/4: 3 chicks seen between 111 and 113, could not determine which were from which nest; 4/27: Flag pulled, collapsed" +2023,6th_bridge,113,smwh,2023-05-03,,,,"3/1 bigger eggs 3/8: SNEG perched nearby 3/28: 2C+ 4/4: 3 chicks seen between 111 and 113, could not determine which were from which nest; 4/27: Flag pulled, collapsed" +2023,6th_bridge,291,smwh,2023-02-22,,,,"4/4: egg possibly dead 4/15: dead egg still in nest 4/20: dead chick in nest" +2023,6th_bridge,291,smwh,2023-03-01,1,,incubating,"4/4: egg possibly dead 4/15: dead egg still in nest 4/20: dead chick in nest" +2023,6th_bridge,291,smwh,2023-03-08,3,,incubating,"4/4: egg possibly dead 4/15: dead egg still in nest 4/20: dead chick in nest" +2023,6th_bridge,291,smwh,2023-03-14,3,,incubating,"4/4: egg possibly dead 4/15: dead egg still in nest 4/20: dead chick in nest" +2023,6th_bridge,291,smwh,2023-03-21,3,,incubating,"4/4: egg possibly dead 4/15: dead egg still in nest 4/20: dead chick in nest" +2023,6th_bridge,291,smwh,2023-03-28,1,2,hatching,"4/4: egg possibly dead 4/15: dead egg still in nest 4/20: dead chick in nest" +2023,6th_bridge,291,smwh,2023-04-04,,2,nestling,"4/4: egg possibly dead 4/15: dead egg still in nest 4/20: dead chick in nest" +2023,6th_bridge,291,smwh,2023-04-15,,1,nestling,"4/4: egg possibly dead 4/15: dead egg still in nest 4/20: dead chick in nest" +2023,6th_bridge,291,smwh,2023-04-20,,,empty,"4/4: egg possibly dead 4/15: dead egg still in nest 4/20: dead chick in nest" +2023,6th_bridge,291,smwh,2023-04-27,,,pulled,"4/4: egg possibly dead 4/15: dead egg still in nest 4/20: dead chick in nest" +2023,6th_bridge,291,smwh,2023-05-03,,,,"4/4: egg possibly dead 4/15: dead egg still in nest 4/20: dead chick in nest" +2023,6th_bridge,116,smwh,2023-02-22,3,,incubating,"4/4: 1 dead chick in nest 4/20: dying SMWH on ground under nest, put up in 301 nest in the sun" +2023,6th_bridge,116,smwh,2023-03-01,4,,incubating,"4/4: 1 dead chick in nest 4/20: dying SMWH on ground under nest, put up in 301 nest in the sun" +2023,6th_bridge,116,smwh,2023-03-08,4,,incubating,"4/4: 1 dead chick in nest 4/20: dying SMWH on ground under nest, put up in 301 nest in the sun" +2023,6th_bridge,116,smwh,2023-03-14,4,,incubating,"4/4: 1 dead chick in nest 4/20: dying SMWH on ground under nest, put up in 301 nest in the sun" +2023,6th_bridge,116,smwh,2023-03-21,,4,nestling,"4/4: 1 dead chick in nest 4/20: dying SMWH on ground under nest, put up in 301 nest in the sun" +2023,6th_bridge,116,smwh,2023-03-28,,4,nestling,"4/4: 1 dead chick in nest 4/20: dying SMWH on ground under nest, put up in 301 nest in the sun" +2023,6th_bridge,116,smwh,2023-04-04,,,empty,"4/4: 1 dead chick in nest 4/20: dying SMWH on ground under nest, put up in 301 nest in the sun" +2023,6th_bridge,116,smwh,2023-04-15,,,empty,"4/4: 1 dead chick in nest 4/20: dying SMWH on ground under nest, put up in 301 nest in the sun" +2023,6th_bridge,116,smwh,2023-04-20,,,empty,"4/4: 1 dead chick in nest 4/20: dying SMWH on ground under nest, put up in 301 nest in the sun" +2023,6th_bridge,116,smwh,2023-04-27,,,pulled,"4/4: 1 dead chick in nest 4/20: dying SMWH on ground under nest, put up in 301 nest in the sun" +2023,6th_bridge,116,smwh,2023-05-03,,,,"4/4: 1 dead chick in nest 4/20: dying SMWH on ground under nest, put up in 301 nest in the sun" +2023,6th_bridge,242,smhe,2023-02-22,,,,"3/21: eggshell on the ground, nest taken over by WHIB" +2023,6th_bridge,242,smhe,2023-03-01,1,,incubating,"3/21: eggshell on the ground, nest taken over by WHIB" +2023,6th_bridge,242,smhe,2023-03-08,4,,incubating,"3/21: eggshell on the ground, nest taken over by WHIB" +2023,6th_bridge,242,smhe,2023-03-14,4,,incubating,"3/21: eggshell on the ground, nest taken over by WHIB" +2023,6th_bridge,242,smhe,2023-03-21,,,empty,"3/21: eggshell on the ground, nest taken over by WHIB" +2023,6th_bridge,242,smhe,2023-03-28,,,empty,"3/21: eggshell on the ground, nest taken over by WHIB" +2023,6th_bridge,242,smhe,2023-04-04,,,,"3/21: eggshell on the ground, nest taken over by WHIB" +2023,6th_bridge,242,smhe,2023-04-15,,,,"3/21: eggshell on the ground, nest taken over by WHIB" +2023,6th_bridge,242,smhe,2023-04-20,,,,"3/21: eggshell on the ground, nest taken over by WHIB" +2023,6th_bridge,242,smhe,2023-04-27,,,,"3/21: eggshell on the ground, nest taken over by WHIB" +2023,6th_bridge,242,smhe,2023-05-03,,,,"3/21: eggshell on the ground, nest taken over by WHIB" +2023,6th_bridge,*242,whib,2023-02-22,,,,"4/20: pulled flag" +2023,6th_bridge,*242,whib,2023-03-01,,,,"4/20: pulled flag" +2023,6th_bridge,*242,whib,2023-03-08,,,,"4/20: pulled flag" +2023,6th_bridge,*242,whib,2023-03-14,,,,"4/20: pulled flag" +2023,6th_bridge,*242,whib,2023-03-21,1,,incubating,"4/20: pulled flag" +2023,6th_bridge,*242,whib,2023-03-28,2,,incubating,"4/20: pulled flag" +2023,6th_bridge,*242,whib,2023-04-04,2,,incubating,"4/20: pulled flag" +2023,6th_bridge,*242,whib,2023-04-15,,,empty,"4/20: pulled flag" +2023,6th_bridge,*242,whib,2023-04-20,,,pulled,"4/20: pulled flag" +2023,6th_bridge,*242,whib,2023-04-27,,,,"4/20: pulled flag" +2023,6th_bridge,*242,whib,2023-05-03,,,,"4/20: pulled flag" +2023,6th_bridge,281,bcnh,2023-02-22,,,,"3/8: another eggshell in nest , broken with yolk 4/20: pulled flag" +2023,6th_bridge,281,bcnh,2023-03-01,1,,incubating,"3/8: another eggshell in nest , broken with yolk 4/20: pulled flag" +2023,6th_bridge,281,bcnh,2023-03-08,2,,incubating,"3/8: another eggshell in nest , broken with yolk 4/20: pulled flag" +2023,6th_bridge,281,bcnh,2023-03-14,2,,incubating,"3/8: another eggshell in nest , broken with yolk 4/20: pulled flag" +2023,6th_bridge,281,bcnh,2023-03-21,2,,incubating,"3/8: another eggshell in nest , broken with yolk 4/20: pulled flag" +2023,6th_bridge,281,bcnh,2023-03-28,,2,nestling,"3/8: another eggshell in nest , broken with yolk 4/20: pulled flag" +2023,6th_bridge,281,bcnh,2023-04-04,,,empty,"3/8: another eggshell in nest , broken with yolk 4/20: pulled flag" +2023,6th_bridge,281,bcnh,2023-04-15,,,empty,"3/8: another eggshell in nest , broken with yolk 4/20: pulled flag" +2023,6th_bridge,281,bcnh,2023-04-20,,,pulled,"3/8: another eggshell in nest , broken with yolk 4/20: pulled flag" +2023,6th_bridge,281,bcnh,2023-04-27,,,,"3/8: another eggshell in nest , broken with yolk 4/20: pulled flag" +2023,6th_bridge,281,bcnh,2023-05-03,,,,"3/8: another eggshell in nest , broken with yolk 4/20: pulled flag" +2023,6th_bridge,115,smwh,2023-02-22,4,,incubating,"3/14 4th chick wet" +2023,6th_bridge,115,smwh,2023-03-01,4,,incubating,"3/14 4th chick wet" +2023,6th_bridge,115,smwh,2023-03-08,4,,incubating,"3/14 4th chick wet" +2023,6th_bridge,115,smwh,2023-03-14,,4,wet_chick,"3/14 4th chick wet" +2023,6th_bridge,115,smwh,2023-03-21,,4,nestling,"3/14 4th chick wet" +2023,6th_bridge,115,smwh,2023-03-28,,4,nestling,"3/14 4th chick wet" +2023,6th_bridge,115,smwh,2023-04-04,,,empty,"3/14 4th chick wet" +2023,6th_bridge,115,smwh,2023-04-15,,,,"3/14 4th chick wet" +2023,6th_bridge,115,smwh,2023-04-20,,,,"3/14 4th chick wet" +2023,6th_bridge,115,smwh,2023-04-27,,,,"3/14 4th chick wet" +2023,6th_bridge,115,smwh,2023-05-03,,,,"3/14 4th chick wet" +2023,6th_bridge,*115,glib,2023-02-22,,,,"4/20: broken eggshell" +2023,6th_bridge,*115,glib,2023-03-01,,,,"4/20: broken eggshell" +2023,6th_bridge,*115,glib,2023-03-08,,,,"4/20: broken eggshell" +2023,6th_bridge,*115,glib,2023-03-14,,,,"4/20: broken eggshell" +2023,6th_bridge,*115,glib,2023-03-21,,,,"4/20: broken eggshell" +2023,6th_bridge,*115,glib,2023-03-28,,,,"4/20: broken eggshell" +2023,6th_bridge,*115,glib,2023-04-04,1,,incubating,"4/20: broken eggshell" +2023,6th_bridge,*115,glib,2023-04-15,3,,incubating,"4/20: broken eggshell" +2023,6th_bridge,*115,glib,2023-04-20,,,empty,"4/20: broken eggshell" +2023,6th_bridge,*115,glib,2023-04-27,,,pulled,"4/20: broken eggshell" +2023,6th_bridge,*115,glib,2023-05-03,,,,"4/20: broken eggshell" +2023,6th_bridge,117,bcnh,2023-02-22,3,,incubating,"2/22: unsure if bcnh 3/31: one big chick ran out of the nest on the ground 3/28: 3 large BCNH branchlings in branches above nest, didn't look in nest because of other chicks from nearby nests scrambling around 4/20: pulled flag" +2023,6th_bridge,117,bcnh,2023-03-01,,3,nestling,"2/22: unsure if bcnh 3/31: one big chick ran out of the nest on the ground 3/28: 3 large BCNH branchlings in branches above nest, didn't look in nest because of other chicks from nearby nests scrambling around 4/20: pulled flag" +2023,6th_bridge,117,bcnh,2023-03-08,,3,nestling,"2/22: unsure if bcnh 3/31: one big chick ran out of the nest on the ground 3/28: 3 large BCNH branchlings in branches above nest, didn't look in nest because of other chicks from nearby nests scrambling around 4/20: pulled flag" +2023,6th_bridge,117,bcnh,2023-03-14,,3,nestling,"2/22: unsure if bcnh 3/31: one big chick ran out of the nest on the ground 3/28: 3 large BCNH branchlings in branches above nest, didn't look in nest because of other chicks from nearby nests scrambling around 4/20: pulled flag" +2023,6th_bridge,117,bcnh,2023-03-21,,3,nestling,"2/22: unsure if bcnh 3/31: one big chick ran out of the nest on the ground 3/28: 3 large BCNH branchlings in branches above nest, didn't look in nest because of other chicks from nearby nests scrambling around 4/20: pulled flag" +2023,6th_bridge,117,bcnh,2023-03-28,,3,branchling,"2/22: unsure if bcnh 3/31: one big chick ran out of the nest on the ground 3/28: 3 large BCNH branchlings in branches above nest, didn't look in nest because of other chicks from nearby nests scrambling around 4/20: pulled flag" +2023,6th_bridge,117,bcnh,2023-04-04,,,empty,"2/22: unsure if bcnh 3/31: one big chick ran out of the nest on the ground 3/28: 3 large BCNH branchlings in branches above nest, didn't look in nest because of other chicks from nearby nests scrambling around 4/20: pulled flag" +2023,6th_bridge,117,bcnh,2023-04-15,,,empty,"2/22: unsure if bcnh 3/31: one big chick ran out of the nest on the ground 3/28: 3 large BCNH branchlings in branches above nest, didn't look in nest because of other chicks from nearby nests scrambling around 4/20: pulled flag" +2023,6th_bridge,117,bcnh,2023-04-20,,,pulled,"2/22: unsure if bcnh 3/31: one big chick ran out of the nest on the ground 3/28: 3 large BCNH branchlings in branches above nest, didn't look in nest because of other chicks from nearby nests scrambling around 4/20: pulled flag" +2023,6th_bridge,117,bcnh,2023-04-27,,,,"2/22: unsure if bcnh 3/31: one big chick ran out of the nest on the ground 3/28: 3 large BCNH branchlings in branches above nest, didn't look in nest because of other chicks from nearby nests scrambling around 4/20: pulled flag" +2023,6th_bridge,117,bcnh,2023-05-03,,,,"2/22: unsure if bcnh 3/31: one big chick ran out of the nest on the ground 3/28: 3 large BCNH branchlings in branches above nest, didn't look in nest because of other chicks from nearby nests scrambling around 4/20: pulled flag" +2023,6th_bridge,118,bcnh,2023-02-22,3,,incubating,"4/20: pulled flag" +2023,6th_bridge,118,bcnh,2023-03-01,3,,incubating,"4/20: pulled flag" +2023,6th_bridge,118,bcnh,2023-03-08,3,,incubating,"4/20: pulled flag" +2023,6th_bridge,118,bcnh,2023-03-14,2,1,hatching,"4/20: pulled flag" +2023,6th_bridge,118,bcnh,2023-03-21,,3,nestling,"4/20: pulled flag" +2023,6th_bridge,118,bcnh,2023-03-28,,3,nestling,"4/20: pulled flag" +2023,6th_bridge,118,bcnh,2023-04-04,,2,nestling,"4/20: pulled flag" +2023,6th_bridge,118,bcnh,2023-04-15,,,empty,"4/20: pulled flag" +2023,6th_bridge,118,bcnh,2023-04-20,,,pulled,"4/20: pulled flag" +2023,6th_bridge,118,bcnh,2023-04-27,,,,"4/20: pulled flag" +2023,6th_bridge,118,bcnh,2023-05-03,,,,"4/20: pulled flag" +2023,6th_bridge,307,smwh,2023-02-22,,,,"3/14: 1 egg predated in the nest, JT has pictures 3/21: nest taken over by WHIB" +2023,6th_bridge,307,smwh,2023-03-01,4,,incubating,"3/14: 1 egg predated in the nest, JT has pictures 3/21: nest taken over by WHIB" +2023,6th_bridge,307,smwh,2023-03-08,4,,incubating,"3/14: 1 egg predated in the nest, JT has pictures 3/21: nest taken over by WHIB" +2023,6th_bridge,307,smwh,2023-03-14,1,1,wet_chick,"3/14: 1 egg predated in the nest, JT has pictures 3/21: nest taken over by WHIB" +2023,6th_bridge,307,smwh,2023-03-21,,,empty,"3/14: 1 egg predated in the nest, JT has pictures 3/21: nest taken over by WHIB" +2023,6th_bridge,307,smwh,2023-03-28,,,empty,"3/14: 1 egg predated in the nest, JT has pictures 3/21: nest taken over by WHIB" +2023,6th_bridge,307,smwh,2023-04-04,,,,"3/14: 1 egg predated in the nest, JT has pictures 3/21: nest taken over by WHIB" +2023,6th_bridge,307,smwh,2023-04-15,,,,"3/14: 1 egg predated in the nest, JT has pictures 3/21: nest taken over by WHIB" +2023,6th_bridge,307,smwh,2023-04-20,,,,"3/14: 1 egg predated in the nest, JT has pictures 3/21: nest taken over by WHIB" +2023,6th_bridge,307,smwh,2023-04-27,,,,"3/14: 1 egg predated in the nest, JT has pictures 3/21: nest taken over by WHIB" +2023,6th_bridge,307,smwh,2023-05-03,,,,"3/14: 1 egg predated in the nest, JT has pictures 3/21: nest taken over by WHIB" +2023,6th_bridge,*307,whib,2023-02-22,,,,"4/15: nest gone 4/20: pulled flag" +2023,6th_bridge,*307,whib,2023-03-01,,,,"4/15: nest gone 4/20: pulled flag" +2023,6th_bridge,*307,whib,2023-03-08,,,,"4/15: nest gone 4/20: pulled flag" +2023,6th_bridge,*307,whib,2023-03-14,,,,"4/15: nest gone 4/20: pulled flag" +2023,6th_bridge,*307,whib,2023-03-21,2,,incubating,"4/15: nest gone 4/20: pulled flag" +2023,6th_bridge,*307,whib,2023-03-28,2,,incubating,"4/15: nest gone 4/20: pulled flag" +2023,6th_bridge,*307,whib,2023-04-04,2,,incubating,"4/15: nest gone 4/20: pulled flag" +2023,6th_bridge,*307,whib,2023-04-15,,,empty,"4/15: nest gone 4/20: pulled flag" +2023,6th_bridge,*307,whib,2023-04-20,,,pulled,"4/15: nest gone 4/20: pulled flag" +2023,6th_bridge,*307,whib,2023-04-27,,,,"4/15: nest gone 4/20: pulled flag" +2023,6th_bridge,*307,whib,2023-05-03,,,,"4/15: nest gone 4/20: pulled flag" +2023,6th_bridge,93,smwh,2023-02-22,4,,incubating,"3/14: SNEG adult nearby, 1 chick ran out of sight, possibly off nest platform 3/21: did not check for egg, as chicks were big enough to climb out of the nest, but likely dead egg anyhow 3/28: 4 total SMHE chicks in vicinity of nest, but at least one likely from an unmarked nest nearby 4/4: 1 dead GREG chick dead on the ground in general area of nest, not sure where it came from" +2023,6th_bridge,93,smwh,2023-03-01,4,,incubating,"3/14: SNEG adult nearby, 1 chick ran out of sight, possibly off nest platform 3/21: did not check for egg, as chicks were big enough to climb out of the nest, but likely dead egg anyhow 3/28: 4 total SMHE chicks in vicinity of nest, but at least one likely from an unmarked nest nearby 4/4: 1 dead GREG chick dead on the ground in general area of nest, not sure where it came from" +2023,6th_bridge,93,smwh,2023-03-08,1,3,hatching,"3/14: SNEG adult nearby, 1 chick ran out of sight, possibly off nest platform 3/21: did not check for egg, as chicks were big enough to climb out of the nest, but likely dead egg anyhow 3/28: 4 total SMHE chicks in vicinity of nest, but at least one likely from an unmarked nest nearby 4/4: 1 dead GREG chick dead on the ground in general area of nest, not sure where it came from" +2023,6th_bridge,93,smwh,2023-03-14,1,3,hatching,"3/14: SNEG adult nearby, 1 chick ran out of sight, possibly off nest platform 3/21: did not check for egg, as chicks were big enough to climb out of the nest, but likely dead egg anyhow 3/28: 4 total SMHE chicks in vicinity of nest, but at least one likely from an unmarked nest nearby 4/4: 1 dead GREG chick dead on the ground in general area of nest, not sure where it came from" +2023,6th_bridge,93,smwh,2023-03-21,,3,nestling,"3/14: SNEG adult nearby, 1 chick ran out of sight, possibly off nest platform 3/21: did not check for egg, as chicks were big enough to climb out of the nest, but likely dead egg anyhow 3/28: 4 total SMHE chicks in vicinity of nest, but at least one likely from an unmarked nest nearby 4/4: 1 dead GREG chick dead on the ground in general area of nest, not sure where it came from" +2023,6th_bridge,93,smwh,2023-03-28,,3,nestling,"3/14: SNEG adult nearby, 1 chick ran out of sight, possibly off nest platform 3/21: did not check for egg, as chicks were big enough to climb out of the nest, but likely dead egg anyhow 3/28: 4 total SMHE chicks in vicinity of nest, but at least one likely from an unmarked nest nearby 4/4: 1 dead GREG chick dead on the ground in general area of nest, not sure where it came from" +2023,6th_bridge,93,smwh,2023-04-04,,,empty,"3/14: SNEG adult nearby, 1 chick ran out of sight, possibly off nest platform 3/21: did not check for egg, as chicks were big enough to climb out of the nest, but likely dead egg anyhow 3/28: 4 total SMHE chicks in vicinity of nest, but at least one likely from an unmarked nest nearby 4/4: 1 dead GREG chick dead on the ground in general area of nest, not sure where it came from" +2023,6th_bridge,93,smwh,2023-04-15,,,,"3/14: SNEG adult nearby, 1 chick ran out of sight, possibly off nest platform 3/21: did not check for egg, as chicks were big enough to climb out of the nest, but likely dead egg anyhow 3/28: 4 total SMHE chicks in vicinity of nest, but at least one likely from an unmarked nest nearby 4/4: 1 dead GREG chick dead on the ground in general area of nest, not sure where it came from" +2023,6th_bridge,93,smwh,2023-04-20,,,,"3/14: SNEG adult nearby, 1 chick ran out of sight, possibly off nest platform 3/21: did not check for egg, as chicks were big enough to climb out of the nest, but likely dead egg anyhow 3/28: 4 total SMHE chicks in vicinity of nest, but at least one likely from an unmarked nest nearby 4/4: 1 dead GREG chick dead on the ground in general area of nest, not sure where it came from" +2023,6th_bridge,93,smwh,2023-04-27,,,,"3/14: SNEG adult nearby, 1 chick ran out of sight, possibly off nest platform 3/21: did not check for egg, as chicks were big enough to climb out of the nest, but likely dead egg anyhow 3/28: 4 total SMHE chicks in vicinity of nest, but at least one likely from an unmarked nest nearby 4/4: 1 dead GREG chick dead on the ground in general area of nest, not sure where it came from" +2023,6th_bridge,93,smwh,2023-05-03,,,,"3/14: SNEG adult nearby, 1 chick ran out of sight, possibly off nest platform 3/21: did not check for egg, as chicks were big enough to climb out of the nest, but likely dead egg anyhow 3/28: 4 total SMHE chicks in vicinity of nest, but at least one likely from an unmarked nest nearby 4/4: 1 dead GREG chick dead on the ground in general area of nest, not sure where it came from" +2023,6th_bridge,*93,glib,2023-02-22,,,,"4/20: pulled flag" +2023,6th_bridge,*93,glib,2023-03-01,,,,"4/20: pulled flag" +2023,6th_bridge,*93,glib,2023-03-08,,,,"4/20: pulled flag" +2023,6th_bridge,*93,glib,2023-03-14,,,,"4/20: pulled flag" +2023,6th_bridge,*93,glib,2023-03-21,,,,"4/20: pulled flag" +2023,6th_bridge,*93,glib,2023-03-28,,,,"4/20: pulled flag" +2023,6th_bridge,*93,glib,2023-04-04,1,,incubating,"4/20: pulled flag" +2023,6th_bridge,*93,glib,2023-04-15,,,empty,"4/20: pulled flag" +2023,6th_bridge,*93,glib,2023-04-20,,,pulled,"4/20: pulled flag" +2023,6th_bridge,*93,glib,2023-04-27,,,,"4/20: pulled flag" +2023,6th_bridge,*93,glib,2023-05-03,,,,"4/20: pulled flag" +2023,6th_bridge,137,greg,2023-02-22,1,,incubating,"4/4: eggshell on ground, nest gone; 4/27: Orange paper" +2023,6th_bridge,137,greg,2023-03-01,1,,incubating,"4/4: eggshell on ground, nest gone; 4/27: Orange paper" +2023,6th_bridge,137,greg,2023-03-08,3,,incubating,"4/4: eggshell on ground, nest gone; 4/27: Orange paper" +2023,6th_bridge,137,greg,2023-03-14,3,,incubating,"4/4: eggshell on ground, nest gone; 4/27: Orange paper" +2023,6th_bridge,137,greg,2023-03-21,3,,incubating,"4/4: eggshell on ground, nest gone; 4/27: Orange paper" +2023,6th_bridge,137,greg,2023-03-28,3,,pipping,"4/4: eggshell on ground, nest gone; 4/27: Orange paper" +2023,6th_bridge,137,greg,2023-04-04,,,empty,"4/4: eggshell on ground, nest gone; 4/27: Orange paper" +2023,6th_bridge,137,greg,2023-04-15,,,,"4/4: eggshell on ground, nest gone; 4/27: Orange paper" +2023,6th_bridge,137,greg,2023-04-20,,,,"4/4: eggshell on ground, nest gone; 4/27: Orange paper" +2023,6th_bridge,137,greg,2023-04-27,,,pulled,"4/4: eggshell on ground, nest gone; 4/27: Orange paper" +2023,6th_bridge,137,greg,2023-05-03,,,,"4/4: eggshell on ground, nest gone; 4/27: Orange paper" +2023,6th_bridge,139,greg,2023-02-22,3,,incubating,"3/8: one chick wet, one chick dry 4/20: 1 big GREG chick nearby;4/27 2m from 137, 2 big chicks who can fly nearby; 5/3: one fresh dead SMWH nearby" +2023,6th_bridge,139,greg,2023-03-01,3,,incubating,"3/8: one chick wet, one chick dry 4/20: 1 big GREG chick nearby;4/27 2m from 137, 2 big chicks who can fly nearby; 5/3: one fresh dead SMWH nearby" +2023,6th_bridge,139,greg,2023-03-08,1,2,wet_chick,"3/8: one chick wet, one chick dry 4/20: 1 big GREG chick nearby;4/27 2m from 137, 2 big chicks who can fly nearby; 5/3: one fresh dead SMWH nearby" +2023,6th_bridge,139,greg,2023-03-14,,3,nestling,"3/8: one chick wet, one chick dry 4/20: 1 big GREG chick nearby;4/27 2m from 137, 2 big chicks who can fly nearby; 5/3: one fresh dead SMWH nearby" +2023,6th_bridge,139,greg,2023-03-21,,2,nestling,"3/8: one chick wet, one chick dry 4/20: 1 big GREG chick nearby;4/27 2m from 137, 2 big chicks who can fly nearby; 5/3: one fresh dead SMWH nearby" +2023,6th_bridge,139,greg,2023-03-28,,2,nestling,"3/8: one chick wet, one chick dry 4/20: 1 big GREG chick nearby;4/27 2m from 137, 2 big chicks who can fly nearby; 5/3: one fresh dead SMWH nearby" +2023,6th_bridge,139,greg,2023-04-04,,2,nestling,"3/8: one chick wet, one chick dry 4/20: 1 big GREG chick nearby;4/27 2m from 137, 2 big chicks who can fly nearby; 5/3: one fresh dead SMWH nearby" +2023,6th_bridge,139,greg,2023-04-15,,,empty,"3/8: one chick wet, one chick dry 4/20: 1 big GREG chick nearby;4/27 2m from 137, 2 big chicks who can fly nearby; 5/3: one fresh dead SMWH nearby" +2023,6th_bridge,139,greg,2023-04-20,,,empty,"3/8: one chick wet, one chick dry 4/20: 1 big GREG chick nearby;4/27 2m from 137, 2 big chicks who can fly nearby; 5/3: one fresh dead SMWH nearby" +2023,6th_bridge,139,greg,2023-04-27,,,empty,"3/8: one chick wet, one chick dry 4/20: 1 big GREG chick nearby;4/27 2m from 137, 2 big chicks who can fly nearby; 5/3: one fresh dead SMWH nearby" +2023,6th_bridge,139,greg,2023-05-03,,,pulled,"3/8: one chick wet, one chick dry 4/20: 1 big GREG chick nearby;4/27 2m from 137, 2 big chicks who can fly nearby; 5/3: one fresh dead SMWH nearby" +2023,6th_bridge,119,bcnh,2023-02-22,1,,incubating,"2/22: 1 E whole in nest, 1 E scavenged 4/4: 1 chick plus" +2023,6th_bridge,119,bcnh,2023-03-01,2,,incubating,"2/22: 1 E whole in nest, 1 E scavenged 4/4: 1 chick plus" +2023,6th_bridge,119,bcnh,2023-03-08,2,,incubating,"2/22: 1 E whole in nest, 1 E scavenged 4/4: 1 chick plus" +2023,6th_bridge,119,bcnh,2023-03-14,1,1,hatching,"2/22: 1 E whole in nest, 1 E scavenged 4/4: 1 chick plus" +2023,6th_bridge,119,bcnh,2023-03-21,,2,nestling,"2/22: 1 E whole in nest, 1 E scavenged 4/4: 1 chick plus" +2023,6th_bridge,119,bcnh,2023-03-28,,2,nestling,"2/22: 1 E whole in nest, 1 E scavenged 4/4: 1 chick plus" +2023,6th_bridge,119,bcnh,2023-04-04,,1,branchling,"2/22: 1 E whole in nest, 1 E scavenged 4/4: 1 chick plus" +2023,6th_bridge,119,bcnh,2023-04-15,,,empty,"2/22: 1 E whole in nest, 1 E scavenged 4/4: 1 chick plus" +2023,6th_bridge,119,bcnh,2023-04-20,,,empty,"2/22: 1 E whole in nest, 1 E scavenged 4/4: 1 chick plus" +2023,6th_bridge,119,bcnh,2023-04-27,,,pulled,"2/22: 1 E whole in nest, 1 E scavenged 4/4: 1 chick plus" +2023,6th_bridge,119,bcnh,2023-05-03,,,,"2/22: 1 E whole in nest, 1 E scavenged 4/4: 1 chick plus" +2023,6th_bridge,301,smwh,2023-02-22,,,,"3/1: tiny eggs 4/4: 1 dead chick in nest 4/15: nest collapsed, dead chick on ground 4/20: dead SMWH chick below nest" +2023,6th_bridge,301,smwh,2023-03-01,3,,incubating,"3/1: tiny eggs 4/4: 1 dead chick in nest 4/15: nest collapsed, dead chick on ground 4/20: dead SMWH chick below nest" +2023,6th_bridge,301,smwh,2023-03-08,3,,incubating,"3/1: tiny eggs 4/4: 1 dead chick in nest 4/15: nest collapsed, dead chick on ground 4/20: dead SMWH chick below nest" +2023,6th_bridge,301,smwh,2023-03-14,3,,incubating,"3/1: tiny eggs 4/4: 1 dead chick in nest 4/15: nest collapsed, dead chick on ground 4/20: dead SMWH chick below nest" +2023,6th_bridge,301,smwh,2023-03-21,2,1,wet_chick,"3/1: tiny eggs 4/4: 1 dead chick in nest 4/15: nest collapsed, dead chick on ground 4/20: dead SMWH chick below nest" +2023,6th_bridge,301,smwh,2023-03-28,,3,nestling,"3/1: tiny eggs 4/4: 1 dead chick in nest 4/15: nest collapsed, dead chick on ground 4/20: dead SMWH chick below nest" +2023,6th_bridge,301,smwh,2023-04-04,,2,nestling,"3/1: tiny eggs 4/4: 1 dead chick in nest 4/15: nest collapsed, dead chick on ground 4/20: dead SMWH chick below nest" +2023,6th_bridge,301,smwh,2023-04-15,,,empty,"3/1: tiny eggs 4/4: 1 dead chick in nest 4/15: nest collapsed, dead chick on ground 4/20: dead SMWH chick below nest" +2023,6th_bridge,301,smwh,2023-04-20,,,empty,"3/1: tiny eggs 4/4: 1 dead chick in nest 4/15: nest collapsed, dead chick on ground 4/20: dead SMWH chick below nest" +2023,6th_bridge,301,smwh,2023-04-27,,,pulled,"3/1: tiny eggs 4/4: 1 dead chick in nest 4/15: nest collapsed, dead chick on ground 4/20: dead SMWH chick below nest" +2023,6th_bridge,301,smwh,2023-05-03,,,,"3/1: tiny eggs 4/4: 1 dead chick in nest 4/15: nest collapsed, dead chick on ground 4/20: dead SMWH chick below nest" +2023,6th_bridge,153,smwh,2023-02-22,3,,incubating,"3/1: tiny eggs 3/8: one egg pipping 3/28: 2C+ 4/4: 1 SMWH chick in area, not sure if from nest" +2023,6th_bridge,153,smwh,2023-03-01,3,,incubating,"3/1: tiny eggs 3/8: one egg pipping 3/28: 2C+ 4/4: 1 SMWH chick in area, not sure if from nest" +2023,6th_bridge,153,smwh,2023-03-08,3,,pipping,"3/1: tiny eggs 3/8: one egg pipping 3/28: 2C+ 4/4: 1 SMWH chick in area, not sure if from nest" +2023,6th_bridge,153,smwh,2023-03-14,,3,nestling,"3/1: tiny eggs 3/8: one egg pipping 3/28: 2C+ 4/4: 1 SMWH chick in area, not sure if from nest" +2023,6th_bridge,153,smwh,2023-03-21,,3,nestling,"3/1: tiny eggs 3/8: one egg pipping 3/28: 2C+ 4/4: 1 SMWH chick in area, not sure if from nest" +2023,6th_bridge,153,smwh,2023-03-28,,2,nestling,"3/1: tiny eggs 3/8: one egg pipping 3/28: 2C+ 4/4: 1 SMWH chick in area, not sure if from nest" +2023,6th_bridge,153,smwh,2023-04-04,,,empty,"3/1: tiny eggs 3/8: one egg pipping 3/28: 2C+ 4/4: 1 SMWH chick in area, not sure if from nest" +2023,6th_bridge,153,smwh,2023-04-15,,,,"3/1: tiny eggs 3/8: one egg pipping 3/28: 2C+ 4/4: 1 SMWH chick in area, not sure if from nest" +2023,6th_bridge,153,smwh,2023-04-20,,,,"3/1: tiny eggs 3/8: one egg pipping 3/28: 2C+ 4/4: 1 SMWH chick in area, not sure if from nest" +2023,6th_bridge,153,smwh,2023-04-27,,,,"3/1: tiny eggs 3/8: one egg pipping 3/28: 2C+ 4/4: 1 SMWH chick in area, not sure if from nest" +2023,6th_bridge,153,smwh,2023-05-03,,,,"3/1: tiny eggs 3/8: one egg pipping 3/28: 2C+ 4/4: 1 SMWH chick in area, not sure if from nest" +2023,6th_bridge,*153,glib,2023-02-22,,,,"4/20: 1 broken egg in nest; 4/27: Flag pulled" +2023,6th_bridge,*153,glib,2023-03-01,,,,"4/20: 1 broken egg in nest; 4/27: Flag pulled" +2023,6th_bridge,*153,glib,2023-03-08,,,,"4/20: 1 broken egg in nest; 4/27: Flag pulled" +2023,6th_bridge,*153,glib,2023-03-14,,,,"4/20: 1 broken egg in nest; 4/27: Flag pulled" +2023,6th_bridge,*153,glib,2023-03-21,,,,"4/20: 1 broken egg in nest; 4/27: Flag pulled" +2023,6th_bridge,*153,glib,2023-03-28,,,,"4/20: 1 broken egg in nest; 4/27: Flag pulled" +2023,6th_bridge,*153,glib,2023-04-04,1,,incubating,"4/20: 1 broken egg in nest; 4/27: Flag pulled" +2023,6th_bridge,*153,glib,2023-04-15,2,,incubating,"4/20: 1 broken egg in nest; 4/27: Flag pulled" +2023,6th_bridge,*153,glib,2023-04-20,1,,incubating,"4/20: 1 broken egg in nest; 4/27: Flag pulled" +2023,6th_bridge,*153,glib,2023-04-27,,,empty,"4/20: 1 broken egg in nest; 4/27: Flag pulled" +2023,6th_bridge,*153,glib,2023-05-03,,,,"4/20: 1 broken egg in nest; 4/27: Flag pulled" +2023,6th_bridge,141,greg,2023-02-22,3,,incubating,"3/8: both chicks dry 3/28: 2C plus 4/4: 2 large chicks and 1 much smaller chick. Took mercury sample from 1 of 2 larger chicks. The other large chick ran off and disappeared into underbrush. 4/15: 1 big dead chick on ground below general nest area, chick in nest big; 4/27: Pink paper" +2023,6th_bridge,141,greg,2023-03-01,3,,incubating,"3/8: both chicks dry 3/28: 2C plus 4/4: 2 large chicks and 1 much smaller chick. Took mercury sample from 1 of 2 larger chicks. The other large chick ran off and disappeared into underbrush. 4/15: 1 big dead chick on ground below general nest area, chick in nest big; 4/27: Pink paper" +2023,6th_bridge,141,greg,2023-03-08,1,2,chick_dry,"3/8: both chicks dry 3/28: 2C plus 4/4: 2 large chicks and 1 much smaller chick. Took mercury sample from 1 of 2 larger chicks. The other large chick ran off and disappeared into underbrush. 4/15: 1 big dead chick on ground below general nest area, chick in nest big; 4/27: Pink paper" +2023,6th_bridge,141,greg,2023-03-14,,3,nestling,"3/8: both chicks dry 3/28: 2C plus 4/4: 2 large chicks and 1 much smaller chick. Took mercury sample from 1 of 2 larger chicks. The other large chick ran off and disappeared into underbrush. 4/15: 1 big dead chick on ground below general nest area, chick in nest big; 4/27: Pink paper" +2023,6th_bridge,141,greg,2023-03-21,,3,nestling,"3/8: both chicks dry 3/28: 2C plus 4/4: 2 large chicks and 1 much smaller chick. Took mercury sample from 1 of 2 larger chicks. The other large chick ran off and disappeared into underbrush. 4/15: 1 big dead chick on ground below general nest area, chick in nest big; 4/27: Pink paper" +2023,6th_bridge,141,greg,2023-03-28,,2,nestling,"3/8: both chicks dry 3/28: 2C plus 4/4: 2 large chicks and 1 much smaller chick. Took mercury sample from 1 of 2 larger chicks. The other large chick ran off and disappeared into underbrush. 4/15: 1 big dead chick on ground below general nest area, chick in nest big; 4/27: Pink paper" +2023,6th_bridge,141,greg,2023-04-04,,3,nestling,"3/8: both chicks dry 3/28: 2C plus 4/4: 2 large chicks and 1 much smaller chick. Took mercury sample from 1 of 2 larger chicks. The other large chick ran off and disappeared into underbrush. 4/15: 1 big dead chick on ground below general nest area, chick in nest big; 4/27: Pink paper" +2023,6th_bridge,141,greg,2023-04-15,,1,nestling,"3/8: both chicks dry 3/28: 2C plus 4/4: 2 large chicks and 1 much smaller chick. Took mercury sample from 1 of 2 larger chicks. The other large chick ran off and disappeared into underbrush. 4/15: 1 big dead chick on ground below general nest area, chick in nest big; 4/27: Pink paper" +2023,6th_bridge,141,greg,2023-04-20,,,empty,"3/8: both chicks dry 3/28: 2C plus 4/4: 2 large chicks and 1 much smaller chick. Took mercury sample from 1 of 2 larger chicks. The other large chick ran off and disappeared into underbrush. 4/15: 1 big dead chick on ground below general nest area, chick in nest big; 4/27: Pink paper" +2023,6th_bridge,141,greg,2023-04-27,,,pulled,"3/8: both chicks dry 3/28: 2C plus 4/4: 2 large chicks and 1 much smaller chick. Took mercury sample from 1 of 2 larger chicks. The other large chick ran off and disappeared into underbrush. 4/15: 1 big dead chick on ground below general nest area, chick in nest big; 4/27: Pink paper" +2023,6th_bridge,141,greg,2023-05-03,,,,"3/8: both chicks dry 3/28: 2C plus 4/4: 2 large chicks and 1 much smaller chick. Took mercury sample from 1 of 2 larger chicks. The other large chick ran off and disappeared into underbrush. 4/15: 1 big dead chick on ground below general nest area, chick in nest big; 4/27: Pink paper" +2023,6th_bridge,143,smwh,2023-02-22,1,,incubating,"3/1: tiny eggs 3/21: egg cracked 4/4: dead egg still in nest 4/15: 1 chick above nest, 1 chick in nest who appears to be dying 4/20: 1 dead chick in nest, looks bigger than chick that was dying last time but hard to say for sure" +2023,6th_bridge,143,smwh,2023-03-01,4,,incubating,"3/1: tiny eggs 3/21: egg cracked 4/4: dead egg still in nest 4/15: 1 chick above nest, 1 chick in nest who appears to be dying 4/20: 1 dead chick in nest, looks bigger than chick that was dying last time but hard to say for sure" +2023,6th_bridge,143,smwh,2023-03-08,4,,incubating,"3/1: tiny eggs 3/21: egg cracked 4/4: dead egg still in nest 4/15: 1 chick above nest, 1 chick in nest who appears to be dying 4/20: 1 dead chick in nest, looks bigger than chick that was dying last time but hard to say for sure" +2023,6th_bridge,143,smwh,2023-03-14,4,,incubating,"3/1: tiny eggs 3/21: egg cracked 4/4: dead egg still in nest 4/15: 1 chick above nest, 1 chick in nest who appears to be dying 4/20: 1 dead chick in nest, looks bigger than chick that was dying last time but hard to say for sure" +2023,6th_bridge,143,smwh,2023-03-21,1,3,nestling,"3/1: tiny eggs 3/21: egg cracked 4/4: dead egg still in nest 4/15: 1 chick above nest, 1 chick in nest who appears to be dying 4/20: 1 dead chick in nest, looks bigger than chick that was dying last time but hard to say for sure" +2023,6th_bridge,143,smwh,2023-03-28,,3,nestling,"3/1: tiny eggs 3/21: egg cracked 4/4: dead egg still in nest 4/15: 1 chick above nest, 1 chick in nest who appears to be dying 4/20: 1 dead chick in nest, looks bigger than chick that was dying last time but hard to say for sure" +2023,6th_bridge,143,smwh,2023-04-04,,1,nestling,"3/1: tiny eggs 3/21: egg cracked 4/4: dead egg still in nest 4/15: 1 chick above nest, 1 chick in nest who appears to be dying 4/20: 1 dead chick in nest, looks bigger than chick that was dying last time but hard to say for sure" +2023,6th_bridge,143,smwh,2023-04-15,,2,nestling,"3/1: tiny eggs 3/21: egg cracked 4/4: dead egg still in nest 4/15: 1 chick above nest, 1 chick in nest who appears to be dying 4/20: 1 dead chick in nest, looks bigger than chick that was dying last time but hard to say for sure" +2023,6th_bridge,143,smwh,2023-04-20,,,empty,"3/1: tiny eggs 3/21: egg cracked 4/4: dead egg still in nest 4/15: 1 chick above nest, 1 chick in nest who appears to be dying 4/20: 1 dead chick in nest, looks bigger than chick that was dying last time but hard to say for sure" +2023,6th_bridge,143,smwh,2023-04-27,,,pulled,"3/1: tiny eggs 3/21: egg cracked 4/4: dead egg still in nest 4/15: 1 chick above nest, 1 chick in nest who appears to be dying 4/20: 1 dead chick in nest, looks bigger than chick that was dying last time but hard to say for sure" +2023,6th_bridge,143,smwh,2023-05-03,,,,"3/1: tiny eggs 3/21: egg cracked 4/4: dead egg still in nest 4/15: 1 chick above nest, 1 chick in nest who appears to be dying 4/20: 1 dead chick in nest, looks bigger than chick that was dying last time but hard to say for sure" +2023,6th_bridge,145,bcnh,2023-02-22,3,,incubating,"3/1: chicks dry 4/4: 1 chick plus" +2023,6th_bridge,145,bcnh,2023-03-01,,3,chick_dry,"3/1: chicks dry 4/4: 1 chick plus" +2023,6th_bridge,145,bcnh,2023-03-08,,3,nestling,"3/1: chicks dry 4/4: 1 chick plus" +2023,6th_bridge,145,bcnh,2023-03-14,,3,nestling,"3/1: chicks dry 4/4: 1 chick plus" +2023,6th_bridge,145,bcnh,2023-03-21,,1,nestling,"3/1: chicks dry 4/4: 1 chick plus" +2023,6th_bridge,145,bcnh,2023-03-28,,3,nestling,"3/1: chicks dry 4/4: 1 chick plus" +2023,6th_bridge,145,bcnh,2023-04-04,,1,nestling,"3/1: chicks dry 4/4: 1 chick plus" +2023,6th_bridge,145,bcnh,2023-04-15,,,empty,"3/1: chicks dry 4/4: 1 chick plus" +2023,6th_bridge,145,bcnh,2023-04-20,,,missed,"3/1: chicks dry 4/4: 1 chick plus" +2023,6th_bridge,145,bcnh,2023-04-27,,,empty,"3/1: chicks dry 4/4: 1 chick plus" +2023,6th_bridge,145,bcnh,2023-05-03,,,pulled,"3/1: chicks dry 4/4: 1 chick plus" +2023,6th_bridge,303,smwh,2023-02-22,,,,"4/15: 2 big SMWH chicks running back in general area; 4/27: Flag pulled" +2023,6th_bridge,303,smwh,2023-03-01,1,,incubating,"4/15: 2 big SMWH chicks running back in general area; 4/27: Flag pulled" +2023,6th_bridge,303,smwh,2023-03-08,2,,incubating,"4/15: 2 big SMWH chicks running back in general area; 4/27: Flag pulled" +2023,6th_bridge,303,smwh,2023-03-14,2,,incubating,"4/15: 2 big SMWH chicks running back in general area; 4/27: Flag pulled" +2023,6th_bridge,303,smwh,2023-03-21,2,,incubating,"4/15: 2 big SMWH chicks running back in general area; 4/27: Flag pulled" +2023,6th_bridge,303,smwh,2023-03-28,,2,nestling,"4/15: 2 big SMWH chicks running back in general area; 4/27: Flag pulled" +2023,6th_bridge,303,smwh,2023-04-04,,2,nestling,"4/15: 2 big SMWH chicks running back in general area; 4/27: Flag pulled" +2023,6th_bridge,303,smwh,2023-04-15,,,empty,"4/15: 2 big SMWH chicks running back in general area; 4/27: Flag pulled" +2023,6th_bridge,303,smwh,2023-04-20,,1,nestling,"4/15: 2 big SMWH chicks running back in general area; 4/27: Flag pulled" +2023,6th_bridge,303,smwh,2023-04-27,,,empty,"4/15: 2 big SMWH chicks running back in general area; 4/27: Flag pulled" +2023,6th_bridge,303,smwh,2023-05-03,,,,"4/15: 2 big SMWH chicks running back in general area; 4/27: Flag pulled" +2023,6th_bridge,155,greg,2023-02-22,1,,incubating,"4/4: 2 chicks plus; 4/27: mercury branchling sad; 5/3: flag pulled" +2023,6th_bridge,155,greg,2023-03-01,3,,incubating,"4/4: 2 chicks plus; 4/27: mercury branchling sad; 5/3: flag pulled" +2023,6th_bridge,155,greg,2023-03-08,3,,incubating,"4/4: 2 chicks plus; 4/27: mercury branchling sad; 5/3: flag pulled" +2023,6th_bridge,155,greg,2023-03-14,3,,incubating,"4/4: 2 chicks plus; 4/27: mercury branchling sad; 5/3: flag pulled" +2023,6th_bridge,155,greg,2023-03-21,1,2,wet_chick,"4/4: 2 chicks plus; 4/27: mercury branchling sad; 5/3: flag pulled" +2023,6th_bridge,155,greg,2023-03-28,,3,nestling,"4/4: 2 chicks plus; 4/27: mercury branchling sad; 5/3: flag pulled" +2023,6th_bridge,155,greg,2023-04-04,,2,nestling,"4/4: 2 chicks plus; 4/27: mercury branchling sad; 5/3: flag pulled" +2023,6th_bridge,155,greg,2023-04-15,,2,nestling,"4/4: 2 chicks plus; 4/27: mercury branchling sad; 5/3: flag pulled" +2023,6th_bridge,155,greg,2023-04-20,,,empty,"4/4: 2 chicks plus; 4/27: mercury branchling sad; 5/3: flag pulled" +2023,6th_bridge,155,greg,2023-04-27,,1,branchling,"4/4: 2 chicks plus; 4/27: mercury branchling sad; 5/3: flag pulled" +2023,6th_bridge,155,greg,2023-05-03,,,empty,"4/4: 2 chicks plus; 4/27: mercury branchling sad; 5/3: flag pulled" +2023,6th_bridge,157,greg,2023-02-22,3,,incubating,"3/1: 1 chick wet 3/21: 1 dead chick in nest 3/28: 1C+, group of 3 large chicks mixed between 157 and 309 4/4: 1 big chick dead in nest, took feathers for mercury sample; 4/27: Orange paper" +2023,6th_bridge,157,greg,2023-03-01,1,2,wet_chick,"3/1: 1 chick wet 3/21: 1 dead chick in nest 3/28: 1C+, group of 3 large chicks mixed between 157 and 309 4/4: 1 big chick dead in nest, took feathers for mercury sample; 4/27: Orange paper" +2023,6th_bridge,157,greg,2023-03-08,,3,nestling,"3/1: 1 chick wet 3/21: 1 dead chick in nest 3/28: 1C+, group of 3 large chicks mixed between 157 and 309 4/4: 1 big chick dead in nest, took feathers for mercury sample; 4/27: Orange paper" +2023,6th_bridge,157,greg,2023-03-14,,3,nestling,"3/1: 1 chick wet 3/21: 1 dead chick in nest 3/28: 1C+, group of 3 large chicks mixed between 157 and 309 4/4: 1 big chick dead in nest, took feathers for mercury sample; 4/27: Orange paper" +2023,6th_bridge,157,greg,2023-03-21,,2,nestling,"3/1: 1 chick wet 3/21: 1 dead chick in nest 3/28: 1C+, group of 3 large chicks mixed between 157 and 309 4/4: 1 big chick dead in nest, took feathers for mercury sample; 4/27: Orange paper" +2023,6th_bridge,157,greg,2023-03-28,,1,nestling,"3/1: 1 chick wet 3/21: 1 dead chick in nest 3/28: 1C+, group of 3 large chicks mixed between 157 and 309 4/4: 1 big chick dead in nest, took feathers for mercury sample; 4/27: Orange paper" +2023,6th_bridge,157,greg,2023-04-04,,,empty,"3/1: 1 chick wet 3/21: 1 dead chick in nest 3/28: 1C+, group of 3 large chicks mixed between 157 and 309 4/4: 1 big chick dead in nest, took feathers for mercury sample; 4/27: Orange paper" +2023,6th_bridge,157,greg,2023-04-15,,,empty,"3/1: 1 chick wet 3/21: 1 dead chick in nest 3/28: 1C+, group of 3 large chicks mixed between 157 and 309 4/4: 1 big chick dead in nest, took feathers for mercury sample; 4/27: Orange paper" +2023,6th_bridge,157,greg,2023-04-20,,,empty,"3/1: 1 chick wet 3/21: 1 dead chick in nest 3/28: 1C+, group of 3 large chicks mixed between 157 and 309 4/4: 1 big chick dead in nest, took feathers for mercury sample; 4/27: Orange paper" +2023,6th_bridge,157,greg,2023-04-27,,,pulled,"3/1: 1 chick wet 3/21: 1 dead chick in nest 3/28: 1C+, group of 3 large chicks mixed between 157 and 309 4/4: 1 big chick dead in nest, took feathers for mercury sample; 4/27: Orange paper" +2023,6th_bridge,157,greg,2023-05-03,,,,"3/1: 1 chick wet 3/21: 1 dead chick in nest 3/28: 1C+, group of 3 large chicks mixed between 157 and 309 4/4: 1 big chick dead in nest, took feathers for mercury sample; 4/27: Orange paper" +2023,6th_bridge,147,smwh,2023-02-22,1,,incubating,"2/22: unsure if bcnh 4/4: 2 chicks plus. 4/15: 1 old dead chick in nest; 4/27: Flag pulled, collapsed" +2023,6th_bridge,147,smwh,2023-03-01,3,,incubating,"2/22: unsure if bcnh 4/4: 2 chicks plus. 4/15: 1 old dead chick in nest; 4/27: Flag pulled, collapsed" +2023,6th_bridge,147,smwh,2023-03-08,4,,incubating,"2/22: unsure if bcnh 4/4: 2 chicks plus. 4/15: 1 old dead chick in nest; 4/27: Flag pulled, collapsed" +2023,6th_bridge,147,smwh,2023-03-14,4,,incubating,"2/22: unsure if bcnh 4/4: 2 chicks plus. 4/15: 1 old dead chick in nest; 4/27: Flag pulled, collapsed" +2023,6th_bridge,147,smwh,2023-03-21,2,2,chick_dry,"2/22: unsure if bcnh 4/4: 2 chicks plus. 4/15: 1 old dead chick in nest; 4/27: Flag pulled, collapsed" +2023,6th_bridge,147,smwh,2023-03-28,,4,nestling,"2/22: unsure if bcnh 4/4: 2 chicks plus. 4/15: 1 old dead chick in nest; 4/27: Flag pulled, collapsed" +2023,6th_bridge,147,smwh,2023-04-04,,2,nestling,"2/22: unsure if bcnh 4/4: 2 chicks plus. 4/15: 1 old dead chick in nest; 4/27: Flag pulled, collapsed" +2023,6th_bridge,147,smwh,2023-04-15,,,empty,"2/22: unsure if bcnh 4/4: 2 chicks plus. 4/15: 1 old dead chick in nest; 4/27: Flag pulled, collapsed" +2023,6th_bridge,147,smwh,2023-04-20,,,missed,"2/22: unsure if bcnh 4/4: 2 chicks plus. 4/15: 1 old dead chick in nest; 4/27: Flag pulled, collapsed" +2023,6th_bridge,147,smwh,2023-04-27,,,empty,"2/22: unsure if bcnh 4/4: 2 chicks plus. 4/15: 1 old dead chick in nest; 4/27: Flag pulled, collapsed" +2023,6th_bridge,147,smwh,2023-05-03,,,,"2/22: unsure if bcnh 4/4: 2 chicks plus. 4/15: 1 old dead chick in nest; 4/27: Flag pulled, collapsed" +2023,6th_bridge,309,greg,2023-02-22,,,,"3/8: on right side of trail, back up on top of vines 3/28: group of 3 large chicks mixed between 157 and 309 4/4: chicks could have run far back out of view; 4/27: blue paper" +2023,6th_bridge,309,greg,2023-03-01,2,,incubating,"3/8: on right side of trail, back up on top of vines 3/28: group of 3 large chicks mixed between 157 and 309 4/4: chicks could have run far back out of view; 4/27: blue paper" +2023,6th_bridge,309,greg,2023-03-08,,2,nestling,"3/8: on right side of trail, back up on top of vines 3/28: group of 3 large chicks mixed between 157 and 309 4/4: chicks could have run far back out of view; 4/27: blue paper" +2023,6th_bridge,309,greg,2023-03-14,,2,nestling,"3/8: on right side of trail, back up on top of vines 3/28: group of 3 large chicks mixed between 157 and 309 4/4: chicks could have run far back out of view; 4/27: blue paper" +2023,6th_bridge,309,greg,2023-03-21,,2,nestling,"3/8: on right side of trail, back up on top of vines 3/28: group of 3 large chicks mixed between 157 and 309 4/4: chicks could have run far back out of view; 4/27: blue paper" +2023,6th_bridge,309,greg,2023-03-28,,2,nestling,"3/8: on right side of trail, back up on top of vines 3/28: group of 3 large chicks mixed between 157 and 309 4/4: chicks could have run far back out of view; 4/27: blue paper" +2023,6th_bridge,309,greg,2023-04-04,,,empty,"3/8: on right side of trail, back up on top of vines 3/28: group of 3 large chicks mixed between 157 and 309 4/4: chicks could have run far back out of view; 4/27: blue paper" +2023,6th_bridge,309,greg,2023-04-15,,,empty,"3/8: on right side of trail, back up on top of vines 3/28: group of 3 large chicks mixed between 157 and 309 4/4: chicks could have run far back out of view; 4/27: blue paper" +2023,6th_bridge,309,greg,2023-04-20,,,empty,"3/8: on right side of trail, back up on top of vines 3/28: group of 3 large chicks mixed between 157 and 309 4/4: chicks could have run far back out of view; 4/27: blue paper" +2023,6th_bridge,309,greg,2023-04-27,,,pulled,"3/8: on right side of trail, back up on top of vines 3/28: group of 3 large chicks mixed between 157 and 309 4/4: chicks could have run far back out of view; 4/27: blue paper" +2023,6th_bridge,309,greg,2023-05-03,,,,"3/8: on right side of trail, back up on top of vines 3/28: group of 3 large chicks mixed between 157 and 309 4/4: chicks could have run far back out of view; 4/27: blue paper" +2023,6th_bridge,121,greg,2023-02-22,3,,incubating,"3/1: 1 egg pipping 3/21: 1 dead chick in nest, and could have had a third chick that ran out of the nest too fast to see 4/15: 1 chick plus in area; 4/27: did NOT mark nest in GPS. (right before 159, across path w/in 3m of 309)" +2023,6th_bridge,121,greg,2023-03-01,2,1,pipping,"3/1: 1 egg pipping 3/21: 1 dead chick in nest, and could have had a third chick that ran out of the nest too fast to see 4/15: 1 chick plus in area; 4/27: did NOT mark nest in GPS. (right before 159, across path w/in 3m of 309)" +2023,6th_bridge,121,greg,2023-03-08,,3,nestling,"3/1: 1 egg pipping 3/21: 1 dead chick in nest, and could have had a third chick that ran out of the nest too fast to see 4/15: 1 chick plus in area; 4/27: did NOT mark nest in GPS. (right before 159, across path w/in 3m of 309)" +2023,6th_bridge,121,greg,2023-03-14,,3,nestling,"3/1: 1 egg pipping 3/21: 1 dead chick in nest, and could have had a third chick that ran out of the nest too fast to see 4/15: 1 chick plus in area; 4/27: did NOT mark nest in GPS. (right before 159, across path w/in 3m of 309)" +2023,6th_bridge,121,greg,2023-03-21,,1,nestling,"3/1: 1 egg pipping 3/21: 1 dead chick in nest, and could have had a third chick that ran out of the nest too fast to see 4/15: 1 chick plus in area; 4/27: did NOT mark nest in GPS. (right before 159, across path w/in 3m of 309)" +2023,6th_bridge,121,greg,2023-03-28,,1,nestling,"3/1: 1 egg pipping 3/21: 1 dead chick in nest, and could have had a third chick that ran out of the nest too fast to see 4/15: 1 chick plus in area; 4/27: did NOT mark nest in GPS. (right before 159, across path w/in 3m of 309)" +2023,6th_bridge,121,greg,2023-04-04,,,empty,"3/1: 1 egg pipping 3/21: 1 dead chick in nest, and could have had a third chick that ran out of the nest too fast to see 4/15: 1 chick plus in area; 4/27: did NOT mark nest in GPS. (right before 159, across path w/in 3m of 309)" +2023,6th_bridge,121,greg,2023-04-15,,,empty,"3/1: 1 egg pipping 3/21: 1 dead chick in nest, and could have had a third chick that ran out of the nest too fast to see 4/15: 1 chick plus in area; 4/27: did NOT mark nest in GPS. (right before 159, across path w/in 3m of 309)" +2023,6th_bridge,121,greg,2023-04-20,,,empty,"3/1: 1 egg pipping 3/21: 1 dead chick in nest, and could have had a third chick that ran out of the nest too fast to see 4/15: 1 chick plus in area; 4/27: did NOT mark nest in GPS. (right before 159, across path w/in 3m of 309)" +2023,6th_bridge,121,greg,2023-04-27,,,pulled,"3/1: 1 egg pipping 3/21: 1 dead chick in nest, and could have had a third chick that ran out of the nest too fast to see 4/15: 1 chick plus in area; 4/27: did NOT mark nest in GPS. (right before 159, across path w/in 3m of 309)" +2023,6th_bridge,121,greg,2023-05-03,,,,"3/1: 1 egg pipping 3/21: 1 dead chick in nest, and could have had a third chick that ran out of the nest too fast to see 4/15: 1 chick plus in area; 4/27: did NOT mark nest in GPS. (right before 159, across path w/in 3m of 309)" +2023,6th_bridge,159,greg,2023-02-22,2,,incubating,"3/8 chick wet 4/15: chick mobile, running back 4/20: 1 decomposed dead chick floating in water below nest; 4/27: sampled for mercury. Possible that chick ran in from another nest (444?), but in 159 nest , probably from 159.Chick sad; 5/3: flag pulled. Did NOT mark nest in GPS" +2023,6th_bridge,159,greg,2023-03-01,2,,incubating,"3/8 chick wet 4/15: chick mobile, running back 4/20: 1 decomposed dead chick floating in water below nest; 4/27: sampled for mercury. Possible that chick ran in from another nest (444?), but in 159 nest , probably from 159.Chick sad; 5/3: flag pulled. Did NOT mark nest in GPS" +2023,6th_bridge,159,greg,2023-03-08,1,1,wet_chick,"3/8 chick wet 4/15: chick mobile, running back 4/20: 1 decomposed dead chick floating in water below nest; 4/27: sampled for mercury. Possible that chick ran in from another nest (444?), but in 159 nest , probably from 159.Chick sad; 5/3: flag pulled. Did NOT mark nest in GPS" +2023,6th_bridge,159,greg,2023-03-14,,2,nestling,"3/8 chick wet 4/15: chick mobile, running back 4/20: 1 decomposed dead chick floating in water below nest; 4/27: sampled for mercury. Possible that chick ran in from another nest (444?), but in 159 nest , probably from 159.Chick sad; 5/3: flag pulled. Did NOT mark nest in GPS" +2023,6th_bridge,159,greg,2023-03-21,,2,nestling,"3/8 chick wet 4/15: chick mobile, running back 4/20: 1 decomposed dead chick floating in water below nest; 4/27: sampled for mercury. Possible that chick ran in from another nest (444?), but in 159 nest , probably from 159.Chick sad; 5/3: flag pulled. Did NOT mark nest in GPS" +2023,6th_bridge,159,greg,2023-03-28,,2,nestling,"3/8 chick wet 4/15: chick mobile, running back 4/20: 1 decomposed dead chick floating in water below nest; 4/27: sampled for mercury. Possible that chick ran in from another nest (444?), but in 159 nest , probably from 159.Chick sad; 5/3: flag pulled. Did NOT mark nest in GPS" +2023,6th_bridge,159,greg,2023-04-04,,2,nestling,"3/8 chick wet 4/15: chick mobile, running back 4/20: 1 decomposed dead chick floating in water below nest; 4/27: sampled for mercury. Possible that chick ran in from another nest (444?), but in 159 nest , probably from 159.Chick sad; 5/3: flag pulled. Did NOT mark nest in GPS" +2023,6th_bridge,159,greg,2023-04-15,,1,branchling,"3/8 chick wet 4/15: chick mobile, running back 4/20: 1 decomposed dead chick floating in water below nest; 4/27: sampled for mercury. Possible that chick ran in from another nest (444?), but in 159 nest , probably from 159.Chick sad; 5/3: flag pulled. Did NOT mark nest in GPS" +2023,6th_bridge,159,greg,2023-04-20,,,empty,"3/8 chick wet 4/15: chick mobile, running back 4/20: 1 decomposed dead chick floating in water below nest; 4/27: sampled for mercury. Possible that chick ran in from another nest (444?), but in 159 nest , probably from 159.Chick sad; 5/3: flag pulled. Did NOT mark nest in GPS" +2023,6th_bridge,159,greg,2023-04-27,,1,branchling,"3/8 chick wet 4/15: chick mobile, running back 4/20: 1 decomposed dead chick floating in water below nest; 4/27: sampled for mercury. Possible that chick ran in from another nest (444?), but in 159 nest , probably from 159.Chick sad; 5/3: flag pulled. Did NOT mark nest in GPS" +2023,6th_bridge,159,greg,2023-05-03,,,empty,"3/8 chick wet 4/15: chick mobile, running back 4/20: 1 decomposed dead chick floating in water below nest; 4/27: sampled for mercury. Possible that chick ran in from another nest (444?), but in 159 nest , probably from 159.Chick sad; 5/3: flag pulled. Did NOT mark nest in GPS" +2023,6th_bridge,123,greg,2023-02-22,1,,incubating,"3/8: nest material on ground, along with 2 broken eggshells 4/15: sampled big mobile GREG chick for mercury who was found near to where the flagging for 123 was, not sure where chick originally came from" +2023,6th_bridge,123,greg,2023-03-01,2,,incubating,"3/8: nest material on ground, along with 2 broken eggshells 4/15: sampled big mobile GREG chick for mercury who was found near to where the flagging for 123 was, not sure where chick originally came from" +2023,6th_bridge,123,greg,2023-03-08,,,empty,"3/8: nest material on ground, along with 2 broken eggshells 4/15: sampled big mobile GREG chick for mercury who was found near to where the flagging for 123 was, not sure where chick originally came from" +2023,6th_bridge,123,greg,2023-03-14,,,,"3/8: nest material on ground, along with 2 broken eggshells 4/15: sampled big mobile GREG chick for mercury who was found near to where the flagging for 123 was, not sure where chick originally came from" +2023,6th_bridge,123,greg,2023-03-21,,,,"3/8: nest material on ground, along with 2 broken eggshells 4/15: sampled big mobile GREG chick for mercury who was found near to where the flagging for 123 was, not sure where chick originally came from" +2023,6th_bridge,123,greg,2023-03-28,,,,"3/8: nest material on ground, along with 2 broken eggshells 4/15: sampled big mobile GREG chick for mercury who was found near to where the flagging for 123 was, not sure where chick originally came from" +2023,6th_bridge,123,greg,2023-04-04,,,,"3/8: nest material on ground, along with 2 broken eggshells 4/15: sampled big mobile GREG chick for mercury who was found near to where the flagging for 123 was, not sure where chick originally came from" +2023,6th_bridge,123,greg,2023-04-15,,,,"3/8: nest material on ground, along with 2 broken eggshells 4/15: sampled big mobile GREG chick for mercury who was found near to where the flagging for 123 was, not sure where chick originally came from" +2023,6th_bridge,123,greg,2023-04-20,,,,"3/8: nest material on ground, along with 2 broken eggshells 4/15: sampled big mobile GREG chick for mercury who was found near to where the flagging for 123 was, not sure where chick originally came from" +2023,6th_bridge,123,greg,2023-04-27,,,,"3/8: nest material on ground, along with 2 broken eggshells 4/15: sampled big mobile GREG chick for mercury who was found near to where the flagging for 123 was, not sure where chick originally came from" +2023,6th_bridge,123,greg,2023-05-03,,,,"3/8: nest material on ground, along with 2 broken eggshells 4/15: sampled big mobile GREG chick for mercury who was found near to where the flagging for 123 was, not sure where chick originally came from" +2023,6th_bridge,125,greg,2023-02-22,3,,incubating,"2/22: To the R of trail, next to 127 3/8: nest to right of 127, no flagging visible, marked with 125 with blue flagging. 3/14: found actual marked 125, gave new nest own number 4/4: 2 chicks plus 4/20: 4 big chicks in general area of 125 & 127; 4/27: Dying big chick on ground btw 444 & 127, put back in 127 nest , took feathers for mercury. Pink paper" +2023,6th_bridge,125,greg,2023-03-01,,,missed,"2/22: To the R of trail, next to 127 3/8: nest to right of 127, no flagging visible, marked with 125 with blue flagging. 3/14: found actual marked 125, gave new nest own number 4/4: 2 chicks plus 4/20: 4 big chicks in general area of 125 & 127; 4/27: Dying big chick on ground btw 444 & 127, put back in 127 nest , took feathers for mercury. Pink paper" +2023,6th_bridge,125,greg,2023-03-08,,,missed,"2/22: To the R of trail, next to 127 3/8: nest to right of 127, no flagging visible, marked with 125 with blue flagging. 3/14: found actual marked 125, gave new nest own number 4/4: 2 chicks plus 4/20: 4 big chicks in general area of 125 & 127; 4/27: Dying big chick on ground btw 444 & 127, put back in 127 nest , took feathers for mercury. Pink paper" +2023,6th_bridge,125,greg,2023-03-14,,3,nestling,"2/22: To the R of trail, next to 127 3/8: nest to right of 127, no flagging visible, marked with 125 with blue flagging. 3/14: found actual marked 125, gave new nest own number 4/4: 2 chicks plus 4/20: 4 big chicks in general area of 125 & 127; 4/27: Dying big chick on ground btw 444 & 127, put back in 127 nest , took feathers for mercury. Pink paper" +2023,6th_bridge,125,greg,2023-03-21,,3,nestling,"2/22: To the R of trail, next to 127 3/8: nest to right of 127, no flagging visible, marked with 125 with blue flagging. 3/14: found actual marked 125, gave new nest own number 4/4: 2 chicks plus 4/20: 4 big chicks in general area of 125 & 127; 4/27: Dying big chick on ground btw 444 & 127, put back in 127 nest , took feathers for mercury. Pink paper" +2023,6th_bridge,125,greg,2023-03-28,,3,nestling,"2/22: To the R of trail, next to 127 3/8: nest to right of 127, no flagging visible, marked with 125 with blue flagging. 3/14: found actual marked 125, gave new nest own number 4/4: 2 chicks plus 4/20: 4 big chicks in general area of 125 & 127; 4/27: Dying big chick on ground btw 444 & 127, put back in 127 nest , took feathers for mercury. Pink paper" +2023,6th_bridge,125,greg,2023-04-04,,2,nestling,"2/22: To the R of trail, next to 127 3/8: nest to right of 127, no flagging visible, marked with 125 with blue flagging. 3/14: found actual marked 125, gave new nest own number 4/4: 2 chicks plus 4/20: 4 big chicks in general area of 125 & 127; 4/27: Dying big chick on ground btw 444 & 127, put back in 127 nest , took feathers for mercury. Pink paper" +2023,6th_bridge,125,greg,2023-04-15,,,missed,"2/22: To the R of trail, next to 127 3/8: nest to right of 127, no flagging visible, marked with 125 with blue flagging. 3/14: found actual marked 125, gave new nest own number 4/4: 2 chicks plus 4/20: 4 big chicks in general area of 125 & 127; 4/27: Dying big chick on ground btw 444 & 127, put back in 127 nest , took feathers for mercury. Pink paper" +2023,6th_bridge,125,greg,2023-04-20,,,empty,"2/22: To the R of trail, next to 127 3/8: nest to right of 127, no flagging visible, marked with 125 with blue flagging. 3/14: found actual marked 125, gave new nest own number 4/4: 2 chicks plus 4/20: 4 big chicks in general area of 125 & 127; 4/27: Dying big chick on ground btw 444 & 127, put back in 127 nest , took feathers for mercury. Pink paper" +2023,6th_bridge,125,greg,2023-04-27,,,empty,"2/22: To the R of trail, next to 127 3/8: nest to right of 127, no flagging visible, marked with 125 with blue flagging. 3/14: found actual marked 125, gave new nest own number 4/4: 2 chicks plus 4/20: 4 big chicks in general area of 125 & 127; 4/27: Dying big chick on ground btw 444 & 127, put back in 127 nest , took feathers for mercury. Pink paper" +2023,6th_bridge,125,greg,2023-05-03,,,pulled,"2/22: To the R of trail, next to 127 3/8: nest to right of 127, no flagging visible, marked with 125 with blue flagging. 3/14: found actual marked 125, gave new nest own number 4/4: 2 chicks plus 4/20: 4 big chicks in general area of 125 & 127; 4/27: Dying big chick on ground btw 444 & 127, put back in 127 nest , took feathers for mercury. Pink paper" +2023,6th_bridge,127,greg,2023-02-22,2,,incubating,"2/22: To the R of trail, next to 125 4/20: 1 chick plus, 4 big chicks in general area of 125 & 127; 4/27: Dying big chick on ground btw 444 & 127, put back in 127 nest , took feathers for mercury. Orange paper, East of nest .5m; 5/3: dead chick in nest" +2023,6th_bridge,127,greg,2023-03-01,2,,incubating,"2/22: To the R of trail, next to 125 4/20: 1 chick plus, 4 big chicks in general area of 125 & 127; 4/27: Dying big chick on ground btw 444 & 127, put back in 127 nest , took feathers for mercury. Orange paper, East of nest .5m; 5/3: dead chick in nest" +2023,6th_bridge,127,greg,2023-03-08,2,,incubating,"2/22: To the R of trail, next to 125 4/20: 1 chick plus, 4 big chicks in general area of 125 & 127; 4/27: Dying big chick on ground btw 444 & 127, put back in 127 nest , took feathers for mercury. Orange paper, East of nest .5m; 5/3: dead chick in nest" +2023,6th_bridge,127,greg,2023-03-14,2,,incubating,"2/22: To the R of trail, next to 125 4/20: 1 chick plus, 4 big chicks in general area of 125 & 127; 4/27: Dying big chick on ground btw 444 & 127, put back in 127 nest , took feathers for mercury. Orange paper, East of nest .5m; 5/3: dead chick in nest" +2023,6th_bridge,127,greg,2023-03-21,,2,nestling,"2/22: To the R of trail, next to 125 4/20: 1 chick plus, 4 big chicks in general area of 125 & 127; 4/27: Dying big chick on ground btw 444 & 127, put back in 127 nest , took feathers for mercury. Orange paper, East of nest .5m; 5/3: dead chick in nest" +2023,6th_bridge,127,greg,2023-03-28,,2,nestling,"2/22: To the R of trail, next to 125 4/20: 1 chick plus, 4 big chicks in general area of 125 & 127; 4/27: Dying big chick on ground btw 444 & 127, put back in 127 nest , took feathers for mercury. Orange paper, East of nest .5m; 5/3: dead chick in nest" +2023,6th_bridge,127,greg,2023-04-04,,2,nestling,"2/22: To the R of trail, next to 125 4/20: 1 chick plus, 4 big chicks in general area of 125 & 127; 4/27: Dying big chick on ground btw 444 & 127, put back in 127 nest , took feathers for mercury. Orange paper, East of nest .5m; 5/3: dead chick in nest" +2023,6th_bridge,127,greg,2023-04-15,,,missed,"2/22: To the R of trail, next to 125 4/20: 1 chick plus, 4 big chicks in general area of 125 & 127; 4/27: Dying big chick on ground btw 444 & 127, put back in 127 nest , took feathers for mercury. Orange paper, East of nest .5m; 5/3: dead chick in nest" +2023,6th_bridge,127,greg,2023-04-20,,1,branchling,"2/22: To the R of trail, next to 125 4/20: 1 chick plus, 4 big chicks in general area of 125 & 127; 4/27: Dying big chick on ground btw 444 & 127, put back in 127 nest , took feathers for mercury. Orange paper, East of nest .5m; 5/3: dead chick in nest" +2023,6th_bridge,127,greg,2023-04-27,,,empty,"2/22: To the R of trail, next to 125 4/20: 1 chick plus, 4 big chicks in general area of 125 & 127; 4/27: Dying big chick on ground btw 444 & 127, put back in 127 nest , took feathers for mercury. Orange paper, East of nest .5m; 5/3: dead chick in nest" +2023,6th_bridge,127,greg,2023-05-03,,,pulled,"2/22: To the R of trail, next to 125 4/20: 1 chick plus, 4 big chicks in general area of 125 & 127; 4/27: Dying big chick on ground btw 444 & 127, put back in 127 nest , took feathers for mercury. Orange paper, East of nest .5m; 5/3: dead chick in nest" +2023,6th_bridge,149,greg,2023-02-22,2,,incubating,"3/14: nest gone; 4/27: GPS marked where think nest was" +2023,6th_bridge,149,greg,2023-03-01,1,,incubating,"3/14: nest gone; 4/27: GPS marked where think nest was" +2023,6th_bridge,149,greg,2023-03-08,3,,incubating,"3/14: nest gone; 4/27: GPS marked where think nest was" +2023,6th_bridge,149,greg,2023-03-14,,,empty,"3/14: nest gone; 4/27: GPS marked where think nest was" +2023,6th_bridge,149,greg,2023-03-21,,,empty,"3/14: nest gone; 4/27: GPS marked where think nest was" +2023,6th_bridge,149,greg,2023-03-28,,,missed,"3/14: nest gone; 4/27: GPS marked where think nest was" +2023,6th_bridge,149,greg,2023-04-04,,,missed,"3/14: nest gone; 4/27: GPS marked where think nest was" +2023,6th_bridge,149,greg,2023-04-15,,,,"3/14: nest gone; 4/27: GPS marked where think nest was" +2023,6th_bridge,149,greg,2023-04-20,,,,"3/14: nest gone; 4/27: GPS marked where think nest was" +2023,6th_bridge,149,greg,2023-04-27,,,pulled,"3/14: nest gone; 4/27: GPS marked where think nest was" +2023,6th_bridge,149,greg,2023-05-03,,,,"3/14: nest gone; 4/27: GPS marked where think nest was" +2023,6th_bridge,161,bcnh,2023-02-22,2,,incubating,"4/27: Flag pulled" +2023,6th_bridge,161,bcnh,2023-03-01,3,,incubating,"4/27: Flag pulled" +2023,6th_bridge,161,bcnh,2023-03-08,3,,incubating,"4/27: Flag pulled" +2023,6th_bridge,161,bcnh,2023-03-14,2,1,chick_dry,"4/27: Flag pulled" +2023,6th_bridge,161,bcnh,2023-03-21,,3,nestling,"4/27: Flag pulled" +2023,6th_bridge,161,bcnh,2023-03-28,,2,nestling,"4/27: Flag pulled" +2023,6th_bridge,161,bcnh,2023-04-04,,1,nestling,"4/27: Flag pulled" +2023,6th_bridge,161,bcnh,2023-04-15,,,missed,"4/27: Flag pulled" +2023,6th_bridge,161,bcnh,2023-04-20,,,missed,"4/27: Flag pulled" +2023,6th_bridge,161,bcnh,2023-04-27,,,empty,"4/27: Flag pulled" +2023,6th_bridge,161,bcnh,2023-05-03,,,,"4/27: Flag pulled" +2023,6th_bridge,151,greg,2023-02-22,2,,incubating,"4/15: saw 3 chicks in area at first, sampled bigger of two chicks close to nest for mercury 4/20: 1 big chick running around in area, 1 dead chick on ground below nest; 4/27: big branchling running back; 5/3: flag pulled, fresh dead chick underneath, blue paper" +2023,6th_bridge,151,greg,2023-03-01,2,,incubating,"4/15: saw 3 chicks in area at first, sampled bigger of two chicks close to nest for mercury 4/20: 1 big chick running around in area, 1 dead chick on ground below nest; 4/27: big branchling running back; 5/3: flag pulled, fresh dead chick underneath, blue paper" +2023,6th_bridge,151,greg,2023-03-08,2,,incubating,"4/15: saw 3 chicks in area at first, sampled bigger of two chicks close to nest for mercury 4/20: 1 big chick running around in area, 1 dead chick on ground below nest; 4/27: big branchling running back; 5/3: flag pulled, fresh dead chick underneath, blue paper" +2023,6th_bridge,151,greg,2023-03-14,,2,nestling,"4/15: saw 3 chicks in area at first, sampled bigger of two chicks close to nest for mercury 4/20: 1 big chick running around in area, 1 dead chick on ground below nest; 4/27: big branchling running back; 5/3: flag pulled, fresh dead chick underneath, blue paper" +2023,6th_bridge,151,greg,2023-03-21,,2,nestling,"4/15: saw 3 chicks in area at first, sampled bigger of two chicks close to nest for mercury 4/20: 1 big chick running around in area, 1 dead chick on ground below nest; 4/27: big branchling running back; 5/3: flag pulled, fresh dead chick underneath, blue paper" +2023,6th_bridge,151,greg,2023-03-28,,2,nestling,"4/15: saw 3 chicks in area at first, sampled bigger of two chicks close to nest for mercury 4/20: 1 big chick running around in area, 1 dead chick on ground below nest; 4/27: big branchling running back; 5/3: flag pulled, fresh dead chick underneath, blue paper" +2023,6th_bridge,151,greg,2023-04-04,,2,nestling,"4/15: saw 3 chicks in area at first, sampled bigger of two chicks close to nest for mercury 4/20: 1 big chick running around in area, 1 dead chick on ground below nest; 4/27: big branchling running back; 5/3: flag pulled, fresh dead chick underneath, blue paper" +2023,6th_bridge,151,greg,2023-04-15,,2,nestling,"4/15: saw 3 chicks in area at first, sampled bigger of two chicks close to nest for mercury 4/20: 1 big chick running around in area, 1 dead chick on ground below nest; 4/27: big branchling running back; 5/3: flag pulled, fresh dead chick underneath, blue paper" +2023,6th_bridge,151,greg,2023-04-20,,,empty,"4/15: saw 3 chicks in area at first, sampled bigger of two chicks close to nest for mercury 4/20: 1 big chick running around in area, 1 dead chick on ground below nest; 4/27: big branchling running back; 5/3: flag pulled, fresh dead chick underneath, blue paper" +2023,6th_bridge,151,greg,2023-04-27,,1,branchling,"4/15: saw 3 chicks in area at first, sampled bigger of two chicks close to nest for mercury 4/20: 1 big chick running around in area, 1 dead chick on ground below nest; 4/27: big branchling running back; 5/3: flag pulled, fresh dead chick underneath, blue paper" +2023,6th_bridge,151,greg,2023-05-03,,,empty,"4/15: saw 3 chicks in area at first, sampled bigger of two chicks close to nest for mercury 4/20: 1 big chick running around in area, 1 dead chick on ground below nest; 4/27: big branchling running back; 5/3: flag pulled, fresh dead chick underneath, blue paper" +2023,6th_bridge,163,greg,2023-02-22,3,,incubating,"3/28: 2C+ 4/4: 1 chick plus; 4/27: Blue paper" +2023,6th_bridge,163,greg,2023-03-01,3,,incubating,"3/28: 2C+ 4/4: 1 chick plus; 4/27: Blue paper" +2023,6th_bridge,163,greg,2023-03-08,,3,nestling,"3/28: 2C+ 4/4: 1 chick plus; 4/27: Blue paper" +2023,6th_bridge,163,greg,2023-03-14,,3,nestling,"3/28: 2C+ 4/4: 1 chick plus; 4/27: Blue paper" +2023,6th_bridge,163,greg,2023-03-21,,3,nestling,"3/28: 2C+ 4/4: 1 chick plus; 4/27: Blue paper" +2023,6th_bridge,163,greg,2023-03-28,,2,nestling,"3/28: 2C+ 4/4: 1 chick plus; 4/27: Blue paper" +2023,6th_bridge,163,greg,2023-04-04,,1,branchling,"3/28: 2C+ 4/4: 1 chick plus; 4/27: Blue paper" +2023,6th_bridge,163,greg,2023-04-15,,,missed,"3/28: 2C+ 4/4: 1 chick plus; 4/27: Blue paper" +2023,6th_bridge,163,greg,2023-04-20,,,empty,"3/28: 2C+ 4/4: 1 chick plus; 4/27: Blue paper" +2023,6th_bridge,163,greg,2023-04-27,,,pulled,"3/28: 2C+ 4/4: 1 chick plus; 4/27: Blue paper" +2023,6th_bridge,163,greg,2023-05-03,,,,"3/28: 2C+ 4/4: 1 chick plus; 4/27: Blue paper" +2023,6th_bridge,165,bcnh,2023-02-22,3,,incubating,"3/1: 1 wet chick, 1 dry chick 4/20: pulled flag" +2023,6th_bridge,165,bcnh,2023-03-01,1,2,wet_chick,"3/1: 1 wet chick, 1 dry chick 4/20: pulled flag" +2023,6th_bridge,165,bcnh,2023-03-08,,3,nestling,"3/1: 1 wet chick, 1 dry chick 4/20: pulled flag" +2023,6th_bridge,165,bcnh,2023-03-14,,3,nestling,"3/1: 1 wet chick, 1 dry chick 4/20: pulled flag" +2023,6th_bridge,165,bcnh,2023-03-21,,2,nestling,"3/1: 1 wet chick, 1 dry chick 4/20: pulled flag" +2023,6th_bridge,165,bcnh,2023-03-28,,1,nestling,"3/1: 1 wet chick, 1 dry chick 4/20: pulled flag" +2023,6th_bridge,165,bcnh,2023-04-04,,,missed,"3/1: 1 wet chick, 1 dry chick 4/20: pulled flag" +2023,6th_bridge,165,bcnh,2023-04-15,,,missed,"3/1: 1 wet chick, 1 dry chick 4/20: pulled flag" +2023,6th_bridge,165,bcnh,2023-04-20,,,empty,"3/1: 1 wet chick, 1 dry chick 4/20: pulled flag" +2023,6th_bridge,165,bcnh,2023-04-27,,,,"3/1: 1 wet chick, 1 dry chick 4/20: pulled flag" +2023,6th_bridge,165,bcnh,2023-05-03,,,,"3/1: 1 wet chick, 1 dry chick 4/20: pulled flag" +2023,6th_bridge,129,bcnh,2023-02-22,3,,incubating,"3/14: nest gone 3/21: nest taken over by WHIB" +2023,6th_bridge,129,bcnh,2023-03-01,,,empty,"3/14: nest gone 3/21: nest taken over by WHIB" +2023,6th_bridge,129,bcnh,2023-03-08,,,empty,"3/14: nest gone 3/21: nest taken over by WHIB" +2023,6th_bridge,129,bcnh,2023-03-14,,,empty,"3/14: nest gone 3/21: nest taken over by WHIB" +2023,6th_bridge,129,bcnh,2023-03-21,,,empty,"3/14: nest gone 3/21: nest taken over by WHIB" +2023,6th_bridge,129,bcnh,2023-03-28,,,empty,"3/14: nest gone 3/21: nest taken over by WHIB" +2023,6th_bridge,129,bcnh,2023-04-04,,,,"3/14: nest gone 3/21: nest taken over by WHIB" +2023,6th_bridge,129,bcnh,2023-04-15,,,,"3/14: nest gone 3/21: nest taken over by WHIB" +2023,6th_bridge,129,bcnh,2023-04-20,,,,"3/14: nest gone 3/21: nest taken over by WHIB" +2023,6th_bridge,129,bcnh,2023-04-27,,,,"3/14: nest gone 3/21: nest taken over by WHIB" +2023,6th_bridge,129,bcnh,2023-05-03,,,,"3/14: nest gone 3/21: nest taken over by WHIB" +2023,6th_bridge,*129,whib,2023-02-22,,,,"4/4: 2 eggs predated in nest" +2023,6th_bridge,*129,whib,2023-03-01,,,,"4/4: 2 eggs predated in nest" +2023,6th_bridge,*129,whib,2023-03-08,,,,"4/4: 2 eggs predated in nest" +2023,6th_bridge,*129,whib,2023-03-14,,,,"4/4: 2 eggs predated in nest" +2023,6th_bridge,*129,whib,2023-03-21,2,,incubating,"4/4: 2 eggs predated in nest" +2023,6th_bridge,*129,whib,2023-03-28,2,,incubating,"4/4: 2 eggs predated in nest" +2023,6th_bridge,*129,whib,2023-04-04,,,empty,"4/4: 2 eggs predated in nest" +2023,6th_bridge,*129,whib,2023-04-15,,,empty,"4/4: 2 eggs predated in nest" +2023,6th_bridge,*129,whib,2023-04-20,,,empty,"4/4: 2 eggs predated in nest" +2023,6th_bridge,*129,whib,2023-04-27,,,pulled,"4/4: 2 eggs predated in nest" +2023,6th_bridge,*129,whib,2023-05-03,,,,"4/4: 2 eggs predated in nest" +2023,6th_bridge,289,smwh,2023-02-22,,,, +2023,6th_bridge,289,smwh,2023-03-01,4,,incubating, +2023,6th_bridge,289,smwh,2023-03-08,4,,incubating, +2023,6th_bridge,289,smwh,2023-03-14,2,,incubating, +2023,6th_bridge,289,smwh,2023-03-21,,,missed, +2023,6th_bridge,289,smwh,2023-03-28,,1,nestling, +2023,6th_bridge,289,smwh,2023-04-04,,,empty, +2023,6th_bridge,289,smwh,2023-04-15,,,, +2023,6th_bridge,289,smwh,2023-04-20,,,, +2023,6th_bridge,289,smwh,2023-04-27,,,, +2023,6th_bridge,289,smwh,2023-05-03,,,, +2023,6th_bridge,*289,glib,2023-02-22,,,,"4/20: 2 possibly predated eggs in nest, pulled flag" +2023,6th_bridge,*289,glib,2023-03-01,,,,"4/20: 2 possibly predated eggs in nest, pulled flag" +2023,6th_bridge,*289,glib,2023-03-08,,,,"4/20: 2 possibly predated eggs in nest, pulled flag" +2023,6th_bridge,*289,glib,2023-03-14,,,,"4/20: 2 possibly predated eggs in nest, pulled flag" +2023,6th_bridge,*289,glib,2023-03-21,,,,"4/20: 2 possibly predated eggs in nest, pulled flag" +2023,6th_bridge,*289,glib,2023-03-28,,,,"4/20: 2 possibly predated eggs in nest, pulled flag" +2023,6th_bridge,*289,glib,2023-04-04,,,,"4/20: 2 possibly predated eggs in nest, pulled flag" +2023,6th_bridge,*289,glib,2023-04-15,2,,incubating,"4/20: 2 possibly predated eggs in nest, pulled flag" +2023,6th_bridge,*289,glib,2023-04-20,,,empty,"4/20: 2 possibly predated eggs in nest, pulled flag" +2023,6th_bridge,*289,glib,2023-04-27,,,,"4/20: 2 possibly predated eggs in nest, pulled flag" +2023,6th_bridge,*289,glib,2023-05-03,,,,"4/20: 2 possibly predated eggs in nest, pulled flag" +2023,6th_bridge,277,smwh,2023-02-22,,,,"3/21: 1 chick wet, 1 chick dry 4/20: pulled flag" +2023,6th_bridge,277,smwh,2023-03-01,3,,incubating,"3/21: 1 chick wet, 1 chick dry 4/20: pulled flag" +2023,6th_bridge,277,smwh,2023-03-08,,,missed,"3/21: 1 chick wet, 1 chick dry 4/20: pulled flag" +2023,6th_bridge,277,smwh,2023-03-14,,,missed,"3/21: 1 chick wet, 1 chick dry 4/20: pulled flag" +2023,6th_bridge,277,smwh,2023-03-21,1,2,wet_chick,"3/21: 1 chick wet, 1 chick dry 4/20: pulled flag" +2023,6th_bridge,277,smwh,2023-03-28,,,missed,"3/21: 1 chick wet, 1 chick dry 4/20: pulled flag" +2023,6th_bridge,277,smwh,2023-04-04,,,missed,"3/21: 1 chick wet, 1 chick dry 4/20: pulled flag" +2023,6th_bridge,277,smwh,2023-04-15,,,missed,"3/21: 1 chick wet, 1 chick dry 4/20: pulled flag" +2023,6th_bridge,277,smwh,2023-04-20,,,empty,"3/21: 1 chick wet, 1 chick dry 4/20: pulled flag" +2023,6th_bridge,277,smwh,2023-04-27,,,,"3/21: 1 chick wet, 1 chick dry 4/20: pulled flag" +2023,6th_bridge,277,smwh,2023-05-03,,,,"3/21: 1 chick wet, 1 chick dry 4/20: pulled flag" +2023,6th_bridge,295,bcnh,2023-02-22,,,,"3/1 chick dry" +2023,6th_bridge,295,bcnh,2023-03-01,1,1,chick_dry,"3/1 chick dry" +2023,6th_bridge,295,bcnh,2023-03-08,1,1,hatching,"3/1 chick dry" +2023,6th_bridge,295,bcnh,2023-03-14,1,1,hatching,"3/1 chick dry" +2023,6th_bridge,295,bcnh,2023-03-21,1,1,hatching,"3/1 chick dry" +2023,6th_bridge,295,bcnh,2023-03-28,,1,nestling,"3/1 chick dry" +2023,6th_bridge,295,bcnh,2023-04-04,,,empty,"3/1 chick dry" +2023,6th_bridge,295,bcnh,2023-04-15,,,empty,"3/1 chick dry" +2023,6th_bridge,295,bcnh,2023-04-20,,,empty,"3/1 chick dry" +2023,6th_bridge,295,bcnh,2023-04-27,,,pulled,"3/1 chick dry" +2023,6th_bridge,295,bcnh,2023-05-03,,,,"3/1 chick dry" +2023,6th_bridge,297,smwh,2023-02-22,,,,"3/21: Nest originally identified as BCNH, but hatched chick is SMWH, and current and former number of eggs doesn't make sense" +2023,6th_bridge,297,smwh,2023-03-01,3,,incubating,"3/21: Nest originally identified as BCNH, but hatched chick is SMWH, and current and former number of eggs doesn't make sense" +2023,6th_bridge,297,smwh,2023-03-08,3,,incubating,"3/21: Nest originally identified as BCNH, but hatched chick is SMWH, and current and former number of eggs doesn't make sense" +2023,6th_bridge,297,smwh,2023-03-14,3,,incubating,"3/21: Nest originally identified as BCNH, but hatched chick is SMWH, and current and former number of eggs doesn't make sense" +2023,6th_bridge,297,smwh,2023-03-21,3,1,wet_chick,"3/21: Nest originally identified as BCNH, but hatched chick is SMWH, and current and former number of eggs doesn't make sense" +2023,6th_bridge,297,smwh,2023-03-28,,,empty,"3/21: Nest originally identified as BCNH, but hatched chick is SMWH, and current and former number of eggs doesn't make sense" +2023,6th_bridge,297,smwh,2023-04-04,,,,"3/21: Nest originally identified as BCNH, but hatched chick is SMWH, and current and former number of eggs doesn't make sense" +2023,6th_bridge,297,smwh,2023-04-15,,,,"3/21: Nest originally identified as BCNH, but hatched chick is SMWH, and current and former number of eggs doesn't make sense" +2023,6th_bridge,297,smwh,2023-04-20,,,,"3/21: Nest originally identified as BCNH, but hatched chick is SMWH, and current and former number of eggs doesn't make sense" +2023,6th_bridge,297,smwh,2023-04-27,,,,"3/21: Nest originally identified as BCNH, but hatched chick is SMWH, and current and former number of eggs doesn't make sense" +2023,6th_bridge,297,smwh,2023-05-03,,,,"3/21: Nest originally identified as BCNH, but hatched chick is SMWH, and current and former number of eggs doesn't make sense" +2023,6th_bridge,*297,glib,2023-02-22,,,,"4/20: 3 broken eggs in nest" +2023,6th_bridge,*297,glib,2023-03-01,,,,"4/20: 3 broken eggs in nest" +2023,6th_bridge,*297,glib,2023-03-08,,,,"4/20: 3 broken eggs in nest" +2023,6th_bridge,*297,glib,2023-03-14,,,,"4/20: 3 broken eggs in nest" +2023,6th_bridge,*297,glib,2023-03-21,,,,"4/20: 3 broken eggs in nest" +2023,6th_bridge,*297,glib,2023-03-28,,,,"4/20: 3 broken eggs in nest" +2023,6th_bridge,*297,glib,2023-04-04,2,,incubating,"4/20: 3 broken eggs in nest" +2023,6th_bridge,*297,glib,2023-04-15,,,empty,"4/20: 3 broken eggs in nest" +2023,6th_bridge,*297,glib,2023-04-20,,,empty,"4/20: 3 broken eggs in nest" +2023,6th_bridge,*297,glib,2023-04-27,,,pulled,"4/20: 3 broken eggs in nest" +2023,6th_bridge,*297,glib,2023-05-03,,,,"4/20: 3 broken eggs in nest" +2023,6th_bridge,293,smwh,2023-02-22,,,,"3/14: 4th chick wet" +2023,6th_bridge,293,smwh,2023-03-01,4,,incubating,"3/14: 4th chick wet" +2023,6th_bridge,293,smwh,2023-03-08,4,,incubating,"3/14: 4th chick wet" +2023,6th_bridge,293,smwh,2023-03-14,,4,wet_chick,"3/14: 4th chick wet" +2023,6th_bridge,293,smwh,2023-03-21,,4,nestling,"3/14: 4th chick wet" +2023,6th_bridge,293,smwh,2023-03-28,,3,nestling,"3/14: 4th chick wet" +2023,6th_bridge,293,smwh,2023-04-04,,,empty,"3/14: 4th chick wet" +2023,6th_bridge,293,smwh,2023-04-15,,,empty,"3/14: 4th chick wet" +2023,6th_bridge,293,smwh,2023-04-20,,,empty,"3/14: 4th chick wet" +2023,6th_bridge,293,smwh,2023-04-27,,,pulled,"3/14: 4th chick wet" +2023,6th_bridge,293,smwh,2023-05-03,,,,"3/14: 4th chick wet" +2023,6th_bridge,299,bcnh,2023-02-22,,,,"3/28: 2 chicks certain" +2023,6th_bridge,299,bcnh,2023-03-01,3,,incubating,"3/28: 2 chicks certain" +2023,6th_bridge,299,bcnh,2023-03-08,3,,incubating,"3/28: 2 chicks certain" +2023,6th_bridge,299,bcnh,2023-03-14,3,,pipping,"3/28: 2 chicks certain" +2023,6th_bridge,299,bcnh,2023-03-21,,3,nestling,"3/28: 2 chicks certain" +2023,6th_bridge,299,bcnh,2023-03-28,,2,nestling,"3/28: 2 chicks certain" +2023,6th_bridge,299,bcnh,2023-04-04,,1,nestling,"3/28: 2 chicks certain" +2023,6th_bridge,299,bcnh,2023-04-15,,,empty,"3/28: 2 chicks certain" +2023,6th_bridge,299,bcnh,2023-04-20,,,empty,"3/28: 2 chicks certain" +2023,6th_bridge,299,bcnh,2023-04-27,,,missed,"3/28: 2 chicks certain" +2023,6th_bridge,299,bcnh,2023-05-03,,,missed,"3/28: 2 chicks certain" +2023,6th_bridge,348,smwh,2023-02-22,,,,"4/4: smallest chick wet 4/15: chick on the move 4/20: pulled flag" +2023,6th_bridge,348,smwh,2023-03-01,,,,"4/4: smallest chick wet 4/15: chick on the move 4/20: pulled flag" +2023,6th_bridge,348,smwh,2023-03-08,3,,incubating,"4/4: smallest chick wet 4/15: chick on the move 4/20: pulled flag" +2023,6th_bridge,348,smwh,2023-03-14,4,,incubating,"4/4: smallest chick wet 4/15: chick on the move 4/20: pulled flag" +2023,6th_bridge,348,smwh,2023-03-21,4,,incubating,"4/4: smallest chick wet 4/15: chick on the move 4/20: pulled flag" +2023,6th_bridge,348,smwh,2023-03-28,2,2,wet_chick,"4/4: smallest chick wet 4/15: chick on the move 4/20: pulled flag" +2023,6th_bridge,348,smwh,2023-04-04,,4,nestling,"4/4: smallest chick wet 4/15: chick on the move 4/20: pulled flag" +2023,6th_bridge,348,smwh,2023-04-15,,1,nestling,"4/4: smallest chick wet 4/15: chick on the move 4/20: pulled flag" +2023,6th_bridge,348,smwh,2023-04-20,,,empty,"4/4: smallest chick wet 4/15: chick on the move 4/20: pulled flag" +2023,6th_bridge,348,smwh,2023-04-27,,,,"4/4: smallest chick wet 4/15: chick on the move 4/20: pulled flag" +2023,6th_bridge,348,smwh,2023-05-03,,,,"4/4: smallest chick wet 4/15: chick on the move 4/20: pulled flag" +2023,6th_bridge,350,bcnh,2023-02-22,,,,"4/4: eggshells in nest 4/20: pulled flag" +2023,6th_bridge,350,bcnh,2023-03-01,,,,"4/4: eggshells in nest 4/20: pulled flag" +2023,6th_bridge,350,bcnh,2023-03-08,1,,incubating,"4/4: eggshells in nest 4/20: pulled flag" +2023,6th_bridge,350,bcnh,2023-03-14,1,,incubating,"4/4: eggshells in nest 4/20: pulled flag" +2023,6th_bridge,350,bcnh,2023-03-21,2,,incubating,"4/4: eggshells in nest 4/20: pulled flag" +2023,6th_bridge,350,bcnh,2023-03-28,2,,incubating,"4/4: eggshells in nest 4/20: pulled flag" +2023,6th_bridge,350,bcnh,2023-04-04,,,empty,"4/4: eggshells in nest 4/20: pulled flag" +2023,6th_bridge,350,bcnh,2023-04-15,,,missed,"4/4: eggshells in nest 4/20: pulled flag" +2023,6th_bridge,350,bcnh,2023-04-20,,,empty,"4/4: eggshells in nest 4/20: pulled flag" +2023,6th_bridge,350,bcnh,2023-04-27,,,,"4/4: eggshells in nest 4/20: pulled flag" +2023,6th_bridge,350,bcnh,2023-05-03,,,,"4/4: eggshells in nest 4/20: pulled flag" +2023,6th_bridge,352,bcnh,2023-02-22,,,,"3/28: egg pipping" +2023,6th_bridge,352,bcnh,2023-03-01,,,,"3/28: egg pipping" +2023,6th_bridge,352,bcnh,2023-03-08,3,,incubating,"3/28: egg pipping" +2023,6th_bridge,352,bcnh,2023-03-14,,,missed,"3/28: egg pipping" +2023,6th_bridge,352,bcnh,2023-03-21,2,,incubating,"3/28: egg pipping" +2023,6th_bridge,352,bcnh,2023-03-28,1,1,chick_dry,"3/28: egg pipping" +2023,6th_bridge,352,bcnh,2023-04-04,,,missed,"3/28: egg pipping" +2023,6th_bridge,352,bcnh,2023-04-15,,,empty,"3/28: egg pipping" +2023,6th_bridge,352,bcnh,2023-04-20,,,empty,"3/28: egg pipping" +2023,6th_bridge,352,bcnh,2023-04-27,,,missed,"3/28: egg pipping" +2023,6th_bridge,352,bcnh,2023-05-03,,,missed,"3/28: egg pipping" +2023,6th_bridge,362,smhe,2023-02-22,,,,"3/28: egg pipping; 4/27: Flag pulled" +2023,6th_bridge,362,smhe,2023-03-01,,,,"3/28: egg pipping; 4/27: Flag pulled" +2023,6th_bridge,362,smhe,2023-03-08,4,,incubating,"3/28: egg pipping; 4/27: Flag pulled" +2023,6th_bridge,362,smhe,2023-03-14,4,,incubating,"3/28: egg pipping; 4/27: Flag pulled" +2023,6th_bridge,362,smhe,2023-03-21,4,,incubating,"3/28: egg pipping; 4/27: Flag pulled" +2023,6th_bridge,362,smhe,2023-03-28,1,2,wet_chick,"3/28: egg pipping; 4/27: Flag pulled" +2023,6th_bridge,362,smhe,2023-04-04,,,empty,"3/28: egg pipping; 4/27: Flag pulled" +2023,6th_bridge,362,smhe,2023-04-15,,,missed,"3/28: egg pipping; 4/27: Flag pulled" +2023,6th_bridge,362,smhe,2023-04-20,,,missed,"3/28: egg pipping; 4/27: Flag pulled" +2023,6th_bridge,362,smhe,2023-04-27,,,empty,"3/28: egg pipping; 4/27: Flag pulled" +2023,6th_bridge,362,smhe,2023-05-03,,,,"3/28: egg pipping; 4/27: Flag pulled" +2023,6th_bridge,364,smhe,2023-02-22,,,,"4/20: pulled flag" +2023,6th_bridge,364,smhe,2023-03-01,,,,"4/20: pulled flag" +2023,6th_bridge,364,smhe,2023-03-08,2,,incubating,"4/20: pulled flag" +2023,6th_bridge,364,smhe,2023-03-14,3,,incubating,"4/20: pulled flag" +2023,6th_bridge,364,smhe,2023-03-21,3,,incubating,"4/20: pulled flag" +2023,6th_bridge,364,smhe,2023-03-28,1,,incubating,"4/20: pulled flag" +2023,6th_bridge,364,smhe,2023-04-04,,,empty,"4/20: pulled flag" +2023,6th_bridge,364,smhe,2023-04-15,,,empty,"4/20: pulled flag" +2023,6th_bridge,364,smhe,2023-04-20,,,pulled,"4/20: pulled flag" +2023,6th_bridge,364,smhe,2023-04-27,,,,"4/20: pulled flag" +2023,6th_bridge,364,smhe,2023-05-03,,,,"4/20: pulled flag" +2023,6th_bridge,354,smwh,2023-02-22,,,,"3/21: one egg pipping" +2023,6th_bridge,354,smwh,2023-03-01,,,,"3/21: one egg pipping" +2023,6th_bridge,354,smwh,2023-03-08,4,,incubating,"3/21: one egg pipping" +2023,6th_bridge,354,smwh,2023-03-14,4,,incubating,"3/21: one egg pipping" +2023,6th_bridge,354,smwh,2023-03-21,2,1,wet_chick,"3/21: one egg pipping" +2023,6th_bridge,354,smwh,2023-03-28,,,empty,"3/21: one egg pipping" +2023,6th_bridge,354,smwh,2023-04-04,,,,"3/21: one egg pipping" +2023,6th_bridge,354,smwh,2023-04-15,,,,"3/21: one egg pipping" +2023,6th_bridge,354,smwh,2023-04-20,,,,"3/21: one egg pipping" +2023,6th_bridge,354,smwh,2023-04-27,,,,"3/21: one egg pipping" +2023,6th_bridge,354,smwh,2023-05-03,,,,"3/21: one egg pipping" +2023,6th_bridge,*354,glib,2023-02-22,,,,"4/20: 2 broken (predated?) eggs in nest, pulled flag" +2023,6th_bridge,*354,glib,2023-03-01,,,,"4/20: 2 broken (predated?) eggs in nest, pulled flag" +2023,6th_bridge,*354,glib,2023-03-08,,,,"4/20: 2 broken (predated?) eggs in nest, pulled flag" +2023,6th_bridge,*354,glib,2023-03-14,,,,"4/20: 2 broken (predated?) eggs in nest, pulled flag" +2023,6th_bridge,*354,glib,2023-03-21,,,,"4/20: 2 broken (predated?) eggs in nest, pulled flag" +2023,6th_bridge,*354,glib,2023-03-28,1,,incubating,"4/20: 2 broken (predated?) eggs in nest, pulled flag" +2023,6th_bridge,*354,glib,2023-04-04,,,missed,"4/20: 2 broken (predated?) eggs in nest, pulled flag" +2023,6th_bridge,*354,glib,2023-04-15,2,,incubating,"4/20: 2 broken (predated?) eggs in nest, pulled flag" +2023,6th_bridge,*354,glib,2023-04-20,,,empty,"4/20: 2 broken (predated?) eggs in nest, pulled flag" +2023,6th_bridge,*354,glib,2023-04-27,,,,"4/20: 2 broken (predated?) eggs in nest, pulled flag" +2023,6th_bridge,*354,glib,2023-05-03,,,,"4/20: 2 broken (predated?) eggs in nest, pulled flag" +2023,6th_bridge,366,bcnh,2023-02-22,,,,"4/15: bones in nest 4/20: pulled flag" +2023,6th_bridge,366,bcnh,2023-03-01,,,,"4/15: bones in nest 4/20: pulled flag" +2023,6th_bridge,366,bcnh,2023-03-08,3,,incubating,"4/15: bones in nest 4/20: pulled flag" +2023,6th_bridge,366,bcnh,2023-03-14,3,,incubating,"4/15: bones in nest 4/20: pulled flag" +2023,6th_bridge,366,bcnh,2023-03-21,3,,incubating,"4/15: bones in nest 4/20: pulled flag" +2023,6th_bridge,366,bcnh,2023-03-28,,2,nestling,"4/15: bones in nest 4/20: pulled flag" +2023,6th_bridge,366,bcnh,2023-04-04,,1,nestling,"4/15: bones in nest 4/20: pulled flag" +2023,6th_bridge,366,bcnh,2023-04-15,,,empty,"4/15: bones in nest 4/20: pulled flag" +2023,6th_bridge,366,bcnh,2023-04-20,,,pulled,"4/15: bones in nest 4/20: pulled flag" +2023,6th_bridge,366,bcnh,2023-04-27,,,,"4/15: bones in nest 4/20: pulled flag" +2023,6th_bridge,366,bcnh,2023-05-03,,,,"4/15: bones in nest 4/20: pulled flag" +2023,6th_bridge,356,trhe,2023-02-22,,,,"4/27: Flag pulled" +2023,6th_bridge,356,trhe,2023-03-01,,,,"4/27: Flag pulled" +2023,6th_bridge,356,trhe,2023-03-08,1,,incubating,"4/27: Flag pulled" +2023,6th_bridge,356,trhe,2023-03-14,3,,incubating,"4/27: Flag pulled" +2023,6th_bridge,356,trhe,2023-03-21,3,,incubating,"4/27: Flag pulled" +2023,6th_bridge,356,trhe,2023-03-28,3,,incubating,"4/27: Flag pulled" +2023,6th_bridge,356,trhe,2023-04-04,,3,nestling,"4/27: Flag pulled" +2023,6th_bridge,356,trhe,2023-04-15,,2,nestling,"4/27: Flag pulled" +2023,6th_bridge,356,trhe,2023-04-20,,2,nestling,"4/27: Flag pulled" +2023,6th_bridge,356,trhe,2023-04-27,,,empty,"4/27: Flag pulled" +2023,6th_bridge,356,trhe,2023-05-03,,,,"4/27: Flag pulled" +2023,6th_bridge,368,smwh,2023-02-22,,,,"3/28: egg dented 4/20: pulled flag" +2023,6th_bridge,368,smwh,2023-03-01,,,,"3/28: egg dented 4/20: pulled flag" +2023,6th_bridge,368,smwh,2023-03-08,3,,incubating,"3/28: egg dented 4/20: pulled flag" +2023,6th_bridge,368,smwh,2023-03-14,3,,incubating,"3/28: egg dented 4/20: pulled flag" +2023,6th_bridge,368,smwh,2023-03-21,3,,incubating,"3/28: egg dented 4/20: pulled flag" +2023,6th_bridge,368,smwh,2023-03-28,1,1,hatching,"3/28: egg dented 4/20: pulled flag" +2023,6th_bridge,368,smwh,2023-04-04,,,empty,"3/28: egg dented 4/20: pulled flag" +2023,6th_bridge,368,smwh,2023-04-15,,,empty,"3/28: egg dented 4/20: pulled flag" +2023,6th_bridge,368,smwh,2023-04-20,,,pulled,"3/28: egg dented 4/20: pulled flag" +2023,6th_bridge,368,smwh,2023-04-27,,,,"3/28: egg dented 4/20: pulled flag" +2023,6th_bridge,368,smwh,2023-05-03,,,,"3/28: egg dented 4/20: pulled flag" +2023,6th_bridge,370,smwh,2023-02-22,,,,"3/21: eggshell on ground nearby, but could be from a different nest" +2023,6th_bridge,370,smwh,2023-03-01,,,,"3/21: eggshell on ground nearby, but could be from a different nest" +2023,6th_bridge,370,smwh,2023-03-08,1,,incubating,"3/21: eggshell on ground nearby, but could be from a different nest" +2023,6th_bridge,370,smwh,2023-03-14,3,,incubating,"3/21: eggshell on ground nearby, but could be from a different nest" +2023,6th_bridge,370,smwh,2023-03-21,2,,incubating,"3/21: eggshell on ground nearby, but could be from a different nest" +2023,6th_bridge,370,smwh,2023-03-28,2,,incubating,"3/21: eggshell on ground nearby, but could be from a different nest" +2023,6th_bridge,370,smwh,2023-04-04,,2,nestling,"3/21: eggshell on ground nearby, but could be from a different nest" +2023,6th_bridge,370,smwh,2023-04-15,,,empty,"3/21: eggshell on ground nearby, but could be from a different nest" +2023,6th_bridge,370,smwh,2023-04-20,,,empty,"3/21: eggshell on ground nearby, but could be from a different nest" +2023,6th_bridge,370,smwh,2023-04-27,,,pulled,"3/21: eggshell on ground nearby, but could be from a different nest" +2023,6th_bridge,370,smwh,2023-05-03,,,,"3/21: eggshell on ground nearby, but could be from a different nest" +2023,6th_bridge,372,greg,2023-02-22,,,,"3/28: 2 dead eggs in the nest--broken open 4/20: pulled flag" +2023,6th_bridge,372,greg,2023-03-01,,,,"3/28: 2 dead eggs in the nest--broken open 4/20: pulled flag" +2023,6th_bridge,372,greg,2023-03-08,2,,incubating,"3/28: 2 dead eggs in the nest--broken open 4/20: pulled flag" +2023,6th_bridge,372,greg,2023-03-14,3,,incubating,"3/28: 2 dead eggs in the nest--broken open 4/20: pulled flag" +2023,6th_bridge,372,greg,2023-03-21,3,,incubating,"3/28: 2 dead eggs in the nest--broken open 4/20: pulled flag" +2023,6th_bridge,372,greg,2023-03-28,,,empty,"3/28: 2 dead eggs in the nest--broken open 4/20: pulled flag" +2023,6th_bridge,372,greg,2023-04-04,,,missed,"3/28: 2 dead eggs in the nest--broken open 4/20: pulled flag" +2023,6th_bridge,372,greg,2023-04-15,,,missed,"3/28: 2 dead eggs in the nest--broken open 4/20: pulled flag" +2023,6th_bridge,372,greg,2023-04-20,,,empty,"3/28: 2 dead eggs in the nest--broken open 4/20: pulled flag" +2023,6th_bridge,372,greg,2023-04-27,,,,"3/28: 2 dead eggs in the nest--broken open 4/20: pulled flag" +2023,6th_bridge,372,greg,2023-05-03,,,,"3/28: 2 dead eggs in the nest--broken open 4/20: pulled flag" +2023,6th_bridge,412,bcnh,2023-02-22,,,,"3/21: nest previously listed as GREG, but chicks small and dark" +2023,6th_bridge,412,bcnh,2023-03-01,,,,"3/21: nest previously listed as GREG, but chicks small and dark" +2023,6th_bridge,412,bcnh,2023-03-08,,,,"3/21: nest previously listed as GREG, but chicks small and dark" +2023,6th_bridge,412,bcnh,2023-03-14,3,,incubating,"3/21: nest previously listed as GREG, but chicks small and dark" +2023,6th_bridge,412,bcnh,2023-03-21,,3,nestling,"3/21: nest previously listed as GREG, but chicks small and dark" +2023,6th_bridge,412,bcnh,2023-03-28,,,empty,"3/21: nest previously listed as GREG, but chicks small and dark" +2023,6th_bridge,412,bcnh,2023-04-04,,,,"3/21: nest previously listed as GREG, but chicks small and dark" +2023,6th_bridge,412,bcnh,2023-04-15,,,,"3/21: nest previously listed as GREG, but chicks small and dark" +2023,6th_bridge,412,bcnh,2023-04-20,,,,"3/21: nest previously listed as GREG, but chicks small and dark" +2023,6th_bridge,412,bcnh,2023-04-27,,,,"3/21: nest previously listed as GREG, but chicks small and dark" +2023,6th_bridge,412,bcnh,2023-05-03,,,,"3/21: nest previously listed as GREG, but chicks small and dark" +2023,6th_bridge,*412,glib,2023-02-22,,,,"4/15: broken egg in nest 4/20: pulled flag" +2023,6th_bridge,*412,glib,2023-03-01,,,,"4/15: broken egg in nest 4/20: pulled flag" +2023,6th_bridge,*412,glib,2023-03-08,,,,"4/15: broken egg in nest 4/20: pulled flag" +2023,6th_bridge,*412,glib,2023-03-14,,,,"4/15: broken egg in nest 4/20: pulled flag" +2023,6th_bridge,*412,glib,2023-03-21,,,,"4/15: broken egg in nest 4/20: pulled flag" +2023,6th_bridge,*412,glib,2023-03-28,,,,"4/15: broken egg in nest 4/20: pulled flag" +2023,6th_bridge,*412,glib,2023-04-04,1,,incubating,"4/15: broken egg in nest 4/20: pulled flag" +2023,6th_bridge,*412,glib,2023-04-15,,,empty,"4/15: broken egg in nest 4/20: pulled flag" +2023,6th_bridge,*412,glib,2023-04-20,,,pulled,"4/15: broken egg in nest 4/20: pulled flag" +2023,6th_bridge,*412,glib,2023-04-27,,,,"4/15: broken egg in nest 4/20: pulled flag" +2023,6th_bridge,*412,glib,2023-05-03,,,,"4/15: broken egg in nest 4/20: pulled flag" +2023,6th_bridge,438,trhe,2023-02-22,,,,"3/14: species possibly BCNH 4/4: chick hatching 4/20: confirmed TRHE, nest gone and 2 chicks high above in trees; 4/27: Flag pulled" +2023,6th_bridge,438,trhe,2023-03-01,,,,"3/14: species possibly BCNH 4/4: chick hatching 4/20: confirmed TRHE, nest gone and 2 chicks high above in trees; 4/27: Flag pulled" +2023,6th_bridge,438,trhe,2023-03-08,,,,"3/14: species possibly BCNH 4/4: chick hatching 4/20: confirmed TRHE, nest gone and 2 chicks high above in trees; 4/27: Flag pulled" +2023,6th_bridge,438,trhe,2023-03-14,3,,incubating,"3/14: species possibly BCNH 4/4: chick hatching 4/20: confirmed TRHE, nest gone and 2 chicks high above in trees; 4/27: Flag pulled" +2023,6th_bridge,438,trhe,2023-03-21,3,,incubating,"3/14: species possibly BCNH 4/4: chick hatching 4/20: confirmed TRHE, nest gone and 2 chicks high above in trees; 4/27: Flag pulled" +2023,6th_bridge,438,trhe,2023-03-28,3,,incubating,"3/14: species possibly BCNH 4/4: chick hatching 4/20: confirmed TRHE, nest gone and 2 chicks high above in trees; 4/27: Flag pulled" +2023,6th_bridge,438,trhe,2023-04-04,2,1,hatching,"3/14: species possibly BCNH 4/4: chick hatching 4/20: confirmed TRHE, nest gone and 2 chicks high above in trees; 4/27: Flag pulled" +2023,6th_bridge,438,trhe,2023-04-15,,3,nestling,"3/14: species possibly BCNH 4/4: chick hatching 4/20: confirmed TRHE, nest gone and 2 chicks high above in trees; 4/27: Flag pulled" +2023,6th_bridge,438,trhe,2023-04-20,,2,branchling,"3/14: species possibly BCNH 4/4: chick hatching 4/20: confirmed TRHE, nest gone and 2 chicks high above in trees; 4/27: Flag pulled" +2023,6th_bridge,438,trhe,2023-04-27,,,empty,"3/14: species possibly BCNH 4/4: chick hatching 4/20: confirmed TRHE, nest gone and 2 chicks high above in trees; 4/27: Flag pulled" +2023,6th_bridge,438,trhe,2023-05-03,,,,"3/14: species possibly BCNH 4/4: chick hatching 4/20: confirmed TRHE, nest gone and 2 chicks high above in trees; 4/27: Flag pulled" +2023,6th_bridge,414,smwh,2023-02-22,,,,"4/4: 1 egg pipping 4/15: dead chick pile in nest; 4/27: Dead chick bits in nest" +2023,6th_bridge,414,smwh,2023-03-01,,,,"4/4: 1 egg pipping 4/15: dead chick pile in nest; 4/27: Dead chick bits in nest" +2023,6th_bridge,414,smwh,2023-03-08,,,,"4/4: 1 egg pipping 4/15: dead chick pile in nest; 4/27: Dead chick bits in nest" +2023,6th_bridge,414,smwh,2023-03-14,3,,incubating,"4/4: 1 egg pipping 4/15: dead chick pile in nest; 4/27: Dead chick bits in nest" +2023,6th_bridge,414,smwh,2023-03-21,4,,incubating,"4/4: 1 egg pipping 4/15: dead chick pile in nest; 4/27: Dead chick bits in nest" +2023,6th_bridge,414,smwh,2023-03-28,4,,incubating,"4/4: 1 egg pipping 4/15: dead chick pile in nest; 4/27: Dead chick bits in nest" +2023,6th_bridge,414,smwh,2023-04-04,2,2,hatching,"4/4: 1 egg pipping 4/15: dead chick pile in nest; 4/27: Dead chick bits in nest" +2023,6th_bridge,414,smwh,2023-04-15,,,empty,"4/4: 1 egg pipping 4/15: dead chick pile in nest; 4/27: Dead chick bits in nest" +2023,6th_bridge,414,smwh,2023-04-20,,,empty,"4/4: 1 egg pipping 4/15: dead chick pile in nest; 4/27: Dead chick bits in nest" +2023,6th_bridge,414,smwh,2023-04-27,,,pulled,"4/4: 1 egg pipping 4/15: dead chick pile in nest; 4/27: Dead chick bits in nest" +2023,6th_bridge,414,smwh,2023-05-03,,,,"4/4: 1 egg pipping 4/15: dead chick pile in nest; 4/27: Dead chick bits in nest" +2023,6th_bridge,440,whib,2023-02-22,,,,"4/20: pulled flag" +2023,6th_bridge,440,whib,2023-03-01,,,,"4/20: pulled flag" +2023,6th_bridge,440,whib,2023-03-08,,,,"4/20: pulled flag" +2023,6th_bridge,440,whib,2023-03-14,1,,incubating,"4/20: pulled flag" +2023,6th_bridge,440,whib,2023-03-21,3,,incubating,"4/20: pulled flag" +2023,6th_bridge,440,whib,2023-03-28,3,,incubating,"4/20: pulled flag" +2023,6th_bridge,440,whib,2023-04-04,2,1,wet_chick,"4/20: pulled flag" +2023,6th_bridge,440,whib,2023-04-15,,,empty,"4/20: pulled flag" +2023,6th_bridge,440,whib,2023-04-20,,,pulled,"4/20: pulled flag" +2023,6th_bridge,440,whib,2023-04-27,,,,"4/20: pulled flag" +2023,6th_bridge,440,whib,2023-05-03,,,,"4/20: pulled flag" +2023,6th_bridge,442,whib,2023-02-22,,,,"4/27: Flag pulled, collapsed" +2023,6th_bridge,442,whib,2023-03-01,,,,"4/27: Flag pulled, collapsed" +2023,6th_bridge,442,whib,2023-03-08,,,,"4/27: Flag pulled, collapsed" +2023,6th_bridge,442,whib,2023-03-14,1,,incubating,"4/27: Flag pulled, collapsed" +2023,6th_bridge,442,whib,2023-03-21,3,,incubating,"4/27: Flag pulled, collapsed" +2023,6th_bridge,442,whib,2023-03-28,,,missed,"4/27: Flag pulled, collapsed" +2023,6th_bridge,442,whib,2023-04-04,2,1,chick_dry,"4/27: Flag pulled, collapsed" +2023,6th_bridge,442,whib,2023-04-15,,1,nestling,"4/27: Flag pulled, collapsed" +2023,6th_bridge,442,whib,2023-04-20,,,missed,"4/27: Flag pulled, collapsed" +2023,6th_bridge,442,whib,2023-04-27,,,empty,"4/27: Flag pulled, collapsed" +2023,6th_bridge,442,whib,2023-05-03,,,,"4/27: Flag pulled, collapsed" +2023,6th_bridge,444,greg,2023-02-22,,,,"3/14: Nest was thought to be 125 on 3/8 and had 3 eggs, but real 125 was found on 3/14, and this nest was given a new number 4/20: 1 chick plus; 4/27: Mercury sampled, chick sad; 5/3: fresh dead chick directly underneath" +2023,6th_bridge,444,greg,2023-03-01,,,,"3/14: Nest was thought to be 125 on 3/8 and had 3 eggs, but real 125 was found on 3/14, and this nest was given a new number 4/20: 1 chick plus; 4/27: Mercury sampled, chick sad; 5/3: fresh dead chick directly underneath" +2023,6th_bridge,444,greg,2023-03-08,3,,incubating,"3/14: Nest was thought to be 125 on 3/8 and had 3 eggs, but real 125 was found on 3/14, and this nest was given a new number 4/20: 1 chick plus; 4/27: Mercury sampled, chick sad; 5/3: fresh dead chick directly underneath" +2023,6th_bridge,444,greg,2023-03-14,3,,incubating,"3/14: Nest was thought to be 125 on 3/8 and had 3 eggs, but real 125 was found on 3/14, and this nest was given a new number 4/20: 1 chick plus; 4/27: Mercury sampled, chick sad; 5/3: fresh dead chick directly underneath" +2023,6th_bridge,444,greg,2023-03-21,1,2,chick_dry,"3/14: Nest was thought to be 125 on 3/8 and had 3 eggs, but real 125 was found on 3/14, and this nest was given a new number 4/20: 1 chick plus; 4/27: Mercury sampled, chick sad; 5/3: fresh dead chick directly underneath" +2023,6th_bridge,444,greg,2023-03-28,,2,nestling,"3/14: Nest was thought to be 125 on 3/8 and had 3 eggs, but real 125 was found on 3/14, and this nest was given a new number 4/20: 1 chick plus; 4/27: Mercury sampled, chick sad; 5/3: fresh dead chick directly underneath" +2023,6th_bridge,444,greg,2023-04-04,,2,nestling,"3/14: Nest was thought to be 125 on 3/8 and had 3 eggs, but real 125 was found on 3/14, and this nest was given a new number 4/20: 1 chick plus; 4/27: Mercury sampled, chick sad; 5/3: fresh dead chick directly underneath" +2023,6th_bridge,444,greg,2023-04-15,,,missed,"3/14: Nest was thought to be 125 on 3/8 and had 3 eggs, but real 125 was found on 3/14, and this nest was given a new number 4/20: 1 chick plus; 4/27: Mercury sampled, chick sad; 5/3: fresh dead chick directly underneath" +2023,6th_bridge,444,greg,2023-04-20,,1,nestling,"3/14: Nest was thought to be 125 on 3/8 and had 3 eggs, but real 125 was found on 3/14, and this nest was given a new number 4/20: 1 chick plus; 4/27: Mercury sampled, chick sad; 5/3: fresh dead chick directly underneath" +2023,6th_bridge,444,greg,2023-04-27,,1,branchling,"3/14: Nest was thought to be 125 on 3/8 and had 3 eggs, but real 125 was found on 3/14, and this nest was given a new number 4/20: 1 chick plus; 4/27: Mercury sampled, chick sad; 5/3: fresh dead chick directly underneath" +2023,6th_bridge,444,greg,2023-05-03,,,empty,"3/14: Nest was thought to be 125 on 3/8 and had 3 eggs, but real 125 was found on 3/14, and this nest was given a new number 4/20: 1 chick plus; 4/27: Mercury sampled, chick sad; 5/3: fresh dead chick directly underneath" +2023,6th_bridge,436,whib,2023-02-22,,,, +2023,6th_bridge,436,whib,2023-03-01,,,, +2023,6th_bridge,436,whib,2023-03-08,,,, +2023,6th_bridge,436,whib,2023-03-14,,,, +2023,6th_bridge,436,whib,2023-03-21,2,,incubating, +2023,6th_bridge,436,whib,2023-03-28,2,,incubating, +2023,6th_bridge,436,whib,2023-04-04,2,,incubating, +2023,6th_bridge,436,whib,2023-04-15,,2,nestling, +2023,6th_bridge,436,whib,2023-04-20,,,empty, +2023,6th_bridge,436,whib,2023-04-27,,,pulled, +2023,6th_bridge,436,whib,2023-05-03,,,, +2023,6th_bridge,446,whib,2023-02-22,,,, +2023,6th_bridge,446,whib,2023-03-01,,,, +2023,6th_bridge,446,whib,2023-03-08,,,, +2023,6th_bridge,446,whib,2023-03-14,,,, +2023,6th_bridge,446,whib,2023-03-21,2,,incubating, +2023,6th_bridge,446,whib,2023-03-28,2,,incubating, +2023,6th_bridge,446,whib,2023-04-04,2,,incubating, +2023,6th_bridge,446,whib,2023-04-15,2,,incubating, +2023,6th_bridge,446,whib,2023-04-20,,,empty, +2023,6th_bridge,446,whib,2023-04-27,,,pulled, +2023,6th_bridge,446,whib,2023-05-03,,,, +2023,6th_bridge,519,whib,2023-02-22,,,,"3/21: over old GREG nest 269 4/20: pulled flag" +2023,6th_bridge,519,whib,2023-03-01,,,,"3/21: over old GREG nest 269 4/20: pulled flag" +2023,6th_bridge,519,whib,2023-03-08,,,,"3/21: over old GREG nest 269 4/20: pulled flag" +2023,6th_bridge,519,whib,2023-03-14,,,,"3/21: over old GREG nest 269 4/20: pulled flag" +2023,6th_bridge,519,whib,2023-03-21,2,,incubating,"3/21: over old GREG nest 269 4/20: pulled flag" +2023,6th_bridge,519,whib,2023-03-28,1,,incubating,"3/21: over old GREG nest 269 4/20: pulled flag" +2023,6th_bridge,519,whib,2023-04-04,,,empty,"3/21: over old GREG nest 269 4/20: pulled flag" +2023,6th_bridge,519,whib,2023-04-15,,,empty,"3/21: over old GREG nest 269 4/20: pulled flag" +2023,6th_bridge,519,whib,2023-04-20,,,pulled,"3/21: over old GREG nest 269 4/20: pulled flag" +2023,6th_bridge,519,whib,2023-04-27,,,,"3/21: over old GREG nest 269 4/20: pulled flag" +2023,6th_bridge,519,whib,2023-05-03,,,,"3/21: over old GREG nest 269 4/20: pulled flag" +2023,6th_bridge,521,smhe,2023-02-22,,,,"4/20: pulled flag" +2023,6th_bridge,521,smhe,2023-03-01,,,,"4/20: pulled flag" +2023,6th_bridge,521,smhe,2023-03-08,,,,"4/20: pulled flag" +2023,6th_bridge,521,smhe,2023-03-14,,,,"4/20: pulled flag" +2023,6th_bridge,521,smhe,2023-03-21,2,,incubating,"4/20: pulled flag" +2023,6th_bridge,521,smhe,2023-03-28,2,,incubating,"4/20: pulled flag" +2023,6th_bridge,521,smhe,2023-04-04,2,,incubating,"4/20: pulled flag" +2023,6th_bridge,521,smhe,2023-04-15,,,missed,"4/20: pulled flag" +2023,6th_bridge,521,smhe,2023-04-20,,,empty,"4/20: pulled flag" +2023,6th_bridge,521,smhe,2023-04-27,,,,"4/20: pulled flag" +2023,6th_bridge,521,smhe,2023-05-03,,,,"4/20: pulled flag" +2023,6th_bridge,523,whib,2023-02-22,,,,"4/4: 3 predated eggs in nest 4/20: pulled flag" +2023,6th_bridge,523,whib,2023-03-01,,,,"4/4: 3 predated eggs in nest 4/20: pulled flag" +2023,6th_bridge,523,whib,2023-03-08,,,,"4/4: 3 predated eggs in nest 4/20: pulled flag" +2023,6th_bridge,523,whib,2023-03-14,,,,"4/4: 3 predated eggs in nest 4/20: pulled flag" +2023,6th_bridge,523,whib,2023-03-21,3,,incubating,"4/4: 3 predated eggs in nest 4/20: pulled flag" +2023,6th_bridge,523,whib,2023-03-28,3,,incubating,"4/4: 3 predated eggs in nest 4/20: pulled flag" +2023,6th_bridge,523,whib,2023-04-04,,,empty,"4/4: 3 predated eggs in nest 4/20: pulled flag" +2023,6th_bridge,523,whib,2023-04-15,,,empty,"4/4: 3 predated eggs in nest 4/20: pulled flag" +2023,6th_bridge,523,whib,2023-04-20,,,pulled,"4/4: 3 predated eggs in nest 4/20: pulled flag" +2023,6th_bridge,523,whib,2023-04-27,,,,"4/4: 3 predated eggs in nest 4/20: pulled flag" +2023,6th_bridge,523,whib,2023-05-03,,,,"4/4: 3 predated eggs in nest 4/20: pulled flag" +2023,6th_bridge,525,whib,2023-02-22,,,,"3/21: high nest, flagged below 4/20: nest gone, flag pulled" +2023,6th_bridge,525,whib,2023-03-01,,,,"3/21: high nest, flagged below 4/20: nest gone, flag pulled" +2023,6th_bridge,525,whib,2023-03-08,,,,"3/21: high nest, flagged below 4/20: nest gone, flag pulled" +2023,6th_bridge,525,whib,2023-03-14,,,,"3/21: high nest, flagged below 4/20: nest gone, flag pulled" +2023,6th_bridge,525,whib,2023-03-21,2,,incubating,"3/21: high nest, flagged below 4/20: nest gone, flag pulled" +2023,6th_bridge,525,whib,2023-03-28,2,,incubating,"3/21: high nest, flagged below 4/20: nest gone, flag pulled" +2023,6th_bridge,525,whib,2023-04-04,2,,incubating,"3/21: high nest, flagged below 4/20: nest gone, flag pulled" +2023,6th_bridge,525,whib,2023-04-15,,1,nestling,"3/21: high nest, flagged below 4/20: nest gone, flag pulled" +2023,6th_bridge,525,whib,2023-04-20,,,empty,"3/21: high nest, flagged below 4/20: nest gone, flag pulled" +2023,6th_bridge,525,whib,2023-04-27,,,,"3/21: high nest, flagged below 4/20: nest gone, flag pulled" +2023,6th_bridge,525,whib,2023-05-03,,,,"3/21: high nest, flagged below 4/20: nest gone, flag pulled" +2023,6th_bridge,448,sneg,2023-02-22,,,,"3/28: SNEG adult yelling by nest 4/20: 1 dead chick in nest; 4/27: Flag pulled" +2023,6th_bridge,448,sneg,2023-03-01,,,,"3/28: SNEG adult yelling by nest 4/20: 1 dead chick in nest; 4/27: Flag pulled" +2023,6th_bridge,448,sneg,2023-03-08,,,,"3/28: SNEG adult yelling by nest 4/20: 1 dead chick in nest; 4/27: Flag pulled" +2023,6th_bridge,448,sneg,2023-03-14,,,,"3/28: SNEG adult yelling by nest 4/20: 1 dead chick in nest; 4/27: Flag pulled" +2023,6th_bridge,448,sneg,2023-03-21,3,,incubating,"3/28: SNEG adult yelling by nest 4/20: 1 dead chick in nest; 4/27: Flag pulled" +2023,6th_bridge,448,sneg,2023-03-28,3,,incubating,"3/28: SNEG adult yelling by nest 4/20: 1 dead chick in nest; 4/27: Flag pulled" +2023,6th_bridge,448,sneg,2023-04-04,3,,incubating,"3/28: SNEG adult yelling by nest 4/20: 1 dead chick in nest; 4/27: Flag pulled" +2023,6th_bridge,448,sneg,2023-04-15,,3,nestling,"3/28: SNEG adult yelling by nest 4/20: 1 dead chick in nest; 4/27: Flag pulled" +2023,6th_bridge,448,sneg,2023-04-20,,2,nestling,"3/28: SNEG adult yelling by nest 4/20: 1 dead chick in nest; 4/27: Flag pulled" +2023,6th_bridge,448,sneg,2023-04-27,,,empty,"3/28: SNEG adult yelling by nest 4/20: 1 dead chick in nest; 4/27: Flag pulled" +2023,6th_bridge,448,sneg,2023-05-03,,,,"3/28: SNEG adult yelling by nest 4/20: 1 dead chick in nest; 4/27: Flag pulled" +2023,6th_bridge,527,whib,2023-02-22,,,,"4/20: pulled flag" +2023,6th_bridge,527,whib,2023-03-01,,,,"4/20: pulled flag" +2023,6th_bridge,527,whib,2023-03-08,,,,"4/20: pulled flag" +2023,6th_bridge,527,whib,2023-03-14,,,,"4/20: pulled flag" +2023,6th_bridge,527,whib,2023-03-21,3,,incubating,"4/20: pulled flag" +2023,6th_bridge,527,whib,2023-03-28,3,,incubating,"4/20: pulled flag" +2023,6th_bridge,527,whib,2023-04-04,2,,incubating,"4/20: pulled flag" +2023,6th_bridge,527,whib,2023-04-15,,,empty,"4/20: pulled flag" +2023,6th_bridge,527,whib,2023-04-20,,,pulled,"4/20: pulled flag" +2023,6th_bridge,527,whib,2023-04-27,,,,"4/20: pulled flag" +2023,6th_bridge,527,whib,2023-05-03,,,,"4/20: pulled flag" +2023,6th_bridge,450,glib,2023-02-22,,,,"4/15: broken eggs in nest 4/20: pulled flag" +2023,6th_bridge,450,glib,2023-03-01,,,,"4/15: broken eggs in nest 4/20: pulled flag" +2023,6th_bridge,450,glib,2023-03-08,,,,"4/15: broken eggs in nest 4/20: pulled flag" +2023,6th_bridge,450,glib,2023-03-14,,,,"4/15: broken eggs in nest 4/20: pulled flag" +2023,6th_bridge,450,glib,2023-03-21,1,,incubating,"4/15: broken eggs in nest 4/20: pulled flag" +2023,6th_bridge,450,glib,2023-03-28,3,,incubating,"4/15: broken eggs in nest 4/20: pulled flag" +2023,6th_bridge,450,glib,2023-04-04,3,,incubating,"4/15: broken eggs in nest 4/20: pulled flag" +2023,6th_bridge,450,glib,2023-04-15,,,empty,"4/15: broken eggs in nest 4/20: pulled flag" +2023,6th_bridge,450,glib,2023-04-20,,,pulled,"4/15: broken eggs in nest 4/20: pulled flag" +2023,6th_bridge,450,glib,2023-04-27,,,,"4/15: broken eggs in nest 4/20: pulled flag" +2023,6th_bridge,450,glib,2023-05-03,,,,"4/15: broken eggs in nest 4/20: pulled flag" +2023,6th_bridge,452,whib,2023-02-22,,,,"4/15: both chicks dry and on the bigger side; 4/27: Flag pulled" +2023,6th_bridge,452,whib,2023-03-01,,,,"4/15: both chicks dry and on the bigger side; 4/27: Flag pulled" +2023,6th_bridge,452,whib,2023-03-08,,,,"4/15: both chicks dry and on the bigger side; 4/27: Flag pulled" +2023,6th_bridge,452,whib,2023-03-14,,,,"4/15: both chicks dry and on the bigger side; 4/27: Flag pulled" +2023,6th_bridge,452,whib,2023-03-21,3,,incubating,"4/15: both chicks dry and on the bigger side; 4/27: Flag pulled" +2023,6th_bridge,452,whib,2023-03-28,3,,incubating,"4/15: both chicks dry and on the bigger side; 4/27: Flag pulled" +2023,6th_bridge,452,whib,2023-04-04,3,,incubating,"4/15: both chicks dry and on the bigger side; 4/27: Flag pulled" +2023,6th_bridge,452,whib,2023-04-15,1,2,chick_dry,"4/15: both chicks dry and on the bigger side; 4/27: Flag pulled" +2023,6th_bridge,452,whib,2023-04-20,,1,nestling,"4/15: both chicks dry and on the bigger side; 4/27: Flag pulled" +2023,6th_bridge,452,whib,2023-04-27,,,empty,"4/15: both chicks dry and on the bigger side; 4/27: Flag pulled" +2023,6th_bridge,452,whib,2023-05-03,,,,"4/15: both chicks dry and on the bigger side; 4/27: Flag pulled" +2023,6th_bridge,529,whib,2023-02-22,,,,"4/27: Flag pulled" +2023,6th_bridge,529,whib,2023-03-01,,,,"4/27: Flag pulled" +2023,6th_bridge,529,whib,2023-03-08,,,,"4/27: Flag pulled" +2023,6th_bridge,529,whib,2023-03-14,,,,"4/27: Flag pulled" +2023,6th_bridge,529,whib,2023-03-21,2,,incubating,"4/27: Flag pulled" +2023,6th_bridge,529,whib,2023-03-28,2,,incubating,"4/27: Flag pulled" +2023,6th_bridge,529,whib,2023-04-04,2,,pipping,"4/27: Flag pulled" +2023,6th_bridge,529,whib,2023-04-15,,,empty,"4/27: Flag pulled" +2023,6th_bridge,529,whib,2023-04-20,,,missed,"4/27: Flag pulled" +2023,6th_bridge,529,whib,2023-04-27,,,empty,"4/27: Flag pulled" +2023,6th_bridge,529,whib,2023-05-03,,,,"4/27: Flag pulled" +2023,6th_bridge,531,smhe,2023-02-22,,,,"4/15: nest gone 4/20: pulled flag" +2023,6th_bridge,531,smhe,2023-03-01,,,,"4/15: nest gone 4/20: pulled flag" +2023,6th_bridge,531,smhe,2023-03-08,,,,"4/15: nest gone 4/20: pulled flag" +2023,6th_bridge,531,smhe,2023-03-14,,,,"4/15: nest gone 4/20: pulled flag" +2023,6th_bridge,531,smhe,2023-03-21,2,,incubating,"4/15: nest gone 4/20: pulled flag" +2023,6th_bridge,531,smhe,2023-03-28,2,,incubating,"4/15: nest gone 4/20: pulled flag" +2023,6th_bridge,531,smhe,2023-04-04,2,,incubating,"4/15: nest gone 4/20: pulled flag" +2023,6th_bridge,531,smhe,2023-04-15,,,empty,"4/15: nest gone 4/20: pulled flag" +2023,6th_bridge,531,smhe,2023-04-20,,,pulled,"4/15: nest gone 4/20: pulled flag" +2023,6th_bridge,531,smhe,2023-04-27,,,,"4/15: nest gone 4/20: pulled flag" +2023,6th_bridge,531,smhe,2023-05-03,,,,"4/15: nest gone 4/20: pulled flag" +2023,6th_bridge,533,trhe,2023-02-22,,,,"3/28: switched species to WHIB in book? 4/4: confirmed as SMHE in the field; 4/27: Flag pulled" +2023,6th_bridge,533,trhe,2023-03-01,,,,"3/28: switched species to WHIB in book? 4/4: confirmed as SMHE in the field; 4/27: Flag pulled" +2023,6th_bridge,533,trhe,2023-03-08,,,,"3/28: switched species to WHIB in book? 4/4: confirmed as SMHE in the field; 4/27: Flag pulled" +2023,6th_bridge,533,trhe,2023-03-14,,,,"3/28: switched species to WHIB in book? 4/4: confirmed as SMHE in the field; 4/27: Flag pulled" +2023,6th_bridge,533,trhe,2023-03-21,1,,incubating,"3/28: switched species to WHIB in book? 4/4: confirmed as SMHE in the field; 4/27: Flag pulled" +2023,6th_bridge,533,trhe,2023-03-28,2,,incubating,"3/28: switched species to WHIB in book? 4/4: confirmed as SMHE in the field; 4/27: Flag pulled" +2023,6th_bridge,533,trhe,2023-04-04,2,,incubating,"3/28: switched species to WHIB in book? 4/4: confirmed as SMHE in the field; 4/27: Flag pulled" +2023,6th_bridge,533,trhe,2023-04-15,,2,nestling,"3/28: switched species to WHIB in book? 4/4: confirmed as SMHE in the field; 4/27: Flag pulled" +2023,6th_bridge,533,trhe,2023-04-20,,2,nestling,"3/28: switched species to WHIB in book? 4/4: confirmed as SMHE in the field; 4/27: Flag pulled" +2023,6th_bridge,533,trhe,2023-04-27,,,empty,"3/28: switched species to WHIB in book? 4/4: confirmed as SMHE in the field; 4/27: Flag pulled" +2023,6th_bridge,533,trhe,2023-05-03,,,,"3/28: switched species to WHIB in book? 4/4: confirmed as SMHE in the field; 4/27: Flag pulled" +2023,6th_bridge,535,glib,2023-02-22,,,,"4/15: 2 chicks dying, 1 already dead in nest 4/20: pulled flag" +2023,6th_bridge,535,glib,2023-03-01,,,,"4/15: 2 chicks dying, 1 already dead in nest 4/20: pulled flag" +2023,6th_bridge,535,glib,2023-03-08,,,,"4/15: 2 chicks dying, 1 already dead in nest 4/20: pulled flag" +2023,6th_bridge,535,glib,2023-03-14,,,,"4/15: 2 chicks dying, 1 already dead in nest 4/20: pulled flag" +2023,6th_bridge,535,glib,2023-03-21,1,,incubating,"4/15: 2 chicks dying, 1 already dead in nest 4/20: pulled flag" +2023,6th_bridge,535,glib,2023-03-28,3,,incubating,"4/15: 2 chicks dying, 1 already dead in nest 4/20: pulled flag" +2023,6th_bridge,535,glib,2023-04-04,3,,incubating,"4/15: 2 chicks dying, 1 already dead in nest 4/20: pulled flag" +2023,6th_bridge,535,glib,2023-04-15,,2,nestling,"4/15: 2 chicks dying, 1 already dead in nest 4/20: pulled flag" +2023,6th_bridge,535,glib,2023-04-20,,,empty,"4/15: 2 chicks dying, 1 already dead in nest 4/20: pulled flag" +2023,6th_bridge,535,glib,2023-04-27,,,,"4/15: 2 chicks dying, 1 already dead in nest 4/20: pulled flag" +2023,6th_bridge,535,glib,2023-05-03,,,,"4/15: 2 chicks dying, 1 already dead in nest 4/20: pulled flag" +2023,6th_bridge,537,glib,2023-02-22,,,,"4/20: pulled flag" +2023,6th_bridge,537,glib,2023-03-01,,,,"4/20: pulled flag" +2023,6th_bridge,537,glib,2023-03-08,,,,"4/20: pulled flag" +2023,6th_bridge,537,glib,2023-03-14,,,,"4/20: pulled flag" +2023,6th_bridge,537,glib,2023-03-21,1,,incubating,"4/20: pulled flag" +2023,6th_bridge,537,glib,2023-03-28,3,,incubating,"4/20: pulled flag" +2023,6th_bridge,537,glib,2023-04-04,,,missed,"4/20: pulled flag" +2023,6th_bridge,537,glib,2023-04-15,,3,nestling,"4/20: pulled flag" +2023,6th_bridge,537,glib,2023-04-20,,,empty,"4/20: pulled flag" +2023,6th_bridge,537,glib,2023-04-27,,,,"4/20: pulled flag" +2023,6th_bridge,537,glib,2023-05-03,,,,"4/20: pulled flag" +2023,6th_bridge,539,glib,2023-02-22,,,,"4/15: 1 eggshell nearby 4/20: pulled flag" +2023,6th_bridge,539,glib,2023-03-01,,,,"4/15: 1 eggshell nearby 4/20: pulled flag" +2023,6th_bridge,539,glib,2023-03-08,,,,"4/15: 1 eggshell nearby 4/20: pulled flag" +2023,6th_bridge,539,glib,2023-03-14,,,,"4/15: 1 eggshell nearby 4/20: pulled flag" +2023,6th_bridge,539,glib,2023-03-21,2,,incubating,"4/15: 1 eggshell nearby 4/20: pulled flag" +2023,6th_bridge,539,glib,2023-03-28,3,,incubating,"4/15: 1 eggshell nearby 4/20: pulled flag" +2023,6th_bridge,539,glib,2023-04-04,3,,incubating,"4/15: 1 eggshell nearby 4/20: pulled flag" +2023,6th_bridge,539,glib,2023-04-15,,,empty,"4/15: 1 eggshell nearby 4/20: pulled flag" +2023,6th_bridge,539,glib,2023-04-20,,,empty,"4/15: 1 eggshell nearby 4/20: pulled flag" +2023,6th_bridge,539,glib,2023-04-27,,,,"4/15: 1 eggshell nearby 4/20: pulled flag" +2023,6th_bridge,539,glib,2023-05-03,,,,"4/15: 1 eggshell nearby 4/20: pulled flag" +2023,6th_bridge,454,whib,2023-02-22,,,, +2023,6th_bridge,454,whib,2023-03-01,,,, +2023,6th_bridge,454,whib,2023-03-08,,,, +2023,6th_bridge,454,whib,2023-03-14,,,, +2023,6th_bridge,454,whib,2023-03-21,2,,incubating, +2023,6th_bridge,454,whib,2023-03-28,2,,incubating, +2023,6th_bridge,454,whib,2023-04-04,2,,incubating, +2023,6th_bridge,454,whib,2023-04-15,,,empty, +2023,6th_bridge,454,whib,2023-04-20,,,empty, +2023,6th_bridge,454,whib,2023-04-27,,,pulled, +2023,6th_bridge,454,whib,2023-05-03,,,, +2023,6th_bridge,456,whib,2023-02-22,,,,"5/3: flag pulled" +2023,6th_bridge,456,whib,2023-03-01,,,,"5/3: flag pulled" +2023,6th_bridge,456,whib,2023-03-08,,,,"5/3: flag pulled" +2023,6th_bridge,456,whib,2023-03-14,,,,"5/3: flag pulled" +2023,6th_bridge,456,whib,2023-03-21,2,,incubating,"5/3: flag pulled" +2023,6th_bridge,456,whib,2023-03-28,2,,incubating,"5/3: flag pulled" +2023,6th_bridge,456,whib,2023-04-04,2,,incubating,"5/3: flag pulled" +2023,6th_bridge,456,whib,2023-04-15,,,missed,"5/3: flag pulled" +2023,6th_bridge,456,whib,2023-04-20,,,empty,"5/3: flag pulled" +2023,6th_bridge,456,whib,2023-04-27,,,missed,"5/3: flag pulled" +2023,6th_bridge,456,whib,2023-05-03,,,empty,"5/3: flag pulled" +2023,6th_bridge,458,glib,2023-02-22,,,,"4/15: bloody eggshell in nest; 4/27:Gone" +2023,6th_bridge,458,glib,2023-03-01,,,,"4/15: bloody eggshell in nest; 4/27:Gone" +2023,6th_bridge,458,glib,2023-03-08,,,,"4/15: bloody eggshell in nest; 4/27:Gone" +2023,6th_bridge,458,glib,2023-03-14,,,,"4/15: bloody eggshell in nest; 4/27:Gone" +2023,6th_bridge,458,glib,2023-03-21,1,,incubating,"4/15: bloody eggshell in nest; 4/27:Gone" +2023,6th_bridge,458,glib,2023-03-28,3,,incubating,"4/15: bloody eggshell in nest; 4/27:Gone" +2023,6th_bridge,458,glib,2023-04-04,3,,incubating,"4/15: bloody eggshell in nest; 4/27:Gone" +2023,6th_bridge,458,glib,2023-04-15,,,empty,"4/15: bloody eggshell in nest; 4/27:Gone" +2023,6th_bridge,458,glib,2023-04-20,,,empty,"4/15: bloody eggshell in nest; 4/27:Gone" +2023,6th_bridge,458,glib,2023-04-27,,,pulled,"4/15: bloody eggshell in nest; 4/27:Gone" +2023,6th_bridge,458,glib,2023-05-03,,,,"4/15: bloody eggshell in nest; 4/27:Gone" +2023,6th_bridge,460,whib,2023-02-22,,,,"4/15: both chicks dry, on the bigger side; 4/27: Flag pulled" +2023,6th_bridge,460,whib,2023-03-01,,,,"4/15: both chicks dry, on the bigger side; 4/27: Flag pulled" +2023,6th_bridge,460,whib,2023-03-08,,,,"4/15: both chicks dry, on the bigger side; 4/27: Flag pulled" +2023,6th_bridge,460,whib,2023-03-14,,,,"4/15: both chicks dry, on the bigger side; 4/27: Flag pulled" +2023,6th_bridge,460,whib,2023-03-21,2,,incubating,"4/15: both chicks dry, on the bigger side; 4/27: Flag pulled" +2023,6th_bridge,460,whib,2023-03-28,2,,incubating,"4/15: both chicks dry, on the bigger side; 4/27: Flag pulled" +2023,6th_bridge,460,whib,2023-04-04,2,,incubating,"4/15: both chicks dry, on the bigger side; 4/27: Flag pulled" +2023,6th_bridge,460,whib,2023-04-15,,2,chick_dry,"4/15: both chicks dry, on the bigger side; 4/27: Flag pulled" +2023,6th_bridge,460,whib,2023-04-20,,1,nestling,"4/15: both chicks dry, on the bigger side; 4/27: Flag pulled" +2023,6th_bridge,460,whib,2023-04-27,,,empty,"4/15: both chicks dry, on the bigger side; 4/27: Flag pulled" +2023,6th_bridge,460,whib,2023-05-03,,,,"4/15: both chicks dry, on the bigger side; 4/27: Flag pulled" +2023,6th_bridge,541,glib,2023-02-22,,,,"4/4: Grackle seen in nest earlier but eggs appear fine" +2023,6th_bridge,541,glib,2023-03-01,,,,"4/4: Grackle seen in nest earlier but eggs appear fine" +2023,6th_bridge,541,glib,2023-03-08,,,,"4/4: Grackle seen in nest earlier but eggs appear fine" +2023,6th_bridge,541,glib,2023-03-14,,,,"4/4: Grackle seen in nest earlier but eggs appear fine" +2023,6th_bridge,541,glib,2023-03-21,1,,incubating,"4/4: Grackle seen in nest earlier but eggs appear fine" +2023,6th_bridge,541,glib,2023-03-28,3,,incubating,"4/4: Grackle seen in nest earlier but eggs appear fine" +2023,6th_bridge,541,glib,2023-04-04,3,,incubating,"4/4: Grackle seen in nest earlier but eggs appear fine" +2023,6th_bridge,541,glib,2023-04-15,,1,chick_dry,"4/4: Grackle seen in nest earlier but eggs appear fine" +2023,6th_bridge,541,glib,2023-04-20,,,empty,"4/4: Grackle seen in nest earlier but eggs appear fine" +2023,6th_bridge,541,glib,2023-04-27,,,pulled,"4/4: Grackle seen in nest earlier but eggs appear fine" +2023,6th_bridge,541,glib,2023-05-03,,,,"4/4: Grackle seen in nest earlier but eggs appear fine" +2023,6th_bridge,462,whib,2023-02-22,,,,"3/21: above 67" +2023,6th_bridge,462,whib,2023-03-01,,,,"3/21: above 67" +2023,6th_bridge,462,whib,2023-03-08,,,,"3/21: above 67" +2023,6th_bridge,462,whib,2023-03-14,,,,"3/21: above 67" +2023,6th_bridge,462,whib,2023-03-21,2,,incubating,"3/21: above 67" +2023,6th_bridge,462,whib,2023-03-28,2,,incubating,"3/21: above 67" +2023,6th_bridge,462,whib,2023-04-04,,,missed,"3/21: above 67" +2023,6th_bridge,462,whib,2023-04-15,,1,nestling,"3/21: above 67" +2023,6th_bridge,462,whib,2023-04-20,,,empty,"3/21: above 67" +2023,6th_bridge,462,whib,2023-04-27,,,pulled,"3/21: above 67" +2023,6th_bridge,462,whib,2023-05-03,,,,"3/21: above 67" +2023,6th_bridge,464,whib,2023-02-22,,,,"4/20: pulled flag" +2023,6th_bridge,464,whib,2023-03-01,,,,"4/20: pulled flag" +2023,6th_bridge,464,whib,2023-03-08,,,,"4/20: pulled flag" +2023,6th_bridge,464,whib,2023-03-14,,,,"4/20: pulled flag" +2023,6th_bridge,464,whib,2023-03-21,2,,incubating,"4/20: pulled flag" +2023,6th_bridge,464,whib,2023-03-28,2,,incubating,"4/20: pulled flag" +2023,6th_bridge,464,whib,2023-04-04,2,,incubating,"4/20: pulled flag" +2023,6th_bridge,464,whib,2023-04-15,,,empty,"4/20: pulled flag" +2023,6th_bridge,464,whib,2023-04-20,,,pulled,"4/20: pulled flag" +2023,6th_bridge,464,whib,2023-04-27,,,,"4/20: pulled flag" +2023,6th_bridge,464,whib,2023-05-03,,,,"4/20: pulled flag" +2023,6th_bridge,543,whib,2023-02-22,,,,"4/4: nest partially collapsed 4/15: nest gone 4/20: pulled flag" +2023,6th_bridge,543,whib,2023-03-01,,,,"4/4: nest partially collapsed 4/15: nest gone 4/20: pulled flag" +2023,6th_bridge,543,whib,2023-03-08,,,,"4/4: nest partially collapsed 4/15: nest gone 4/20: pulled flag" +2023,6th_bridge,543,whib,2023-03-14,,,,"4/4: nest partially collapsed 4/15: nest gone 4/20: pulled flag" +2023,6th_bridge,543,whib,2023-03-21,2,,incubating,"4/4: nest partially collapsed 4/15: nest gone 4/20: pulled flag" +2023,6th_bridge,543,whib,2023-03-28,,,empty,"4/4: nest partially collapsed 4/15: nest gone 4/20: pulled flag" +2023,6th_bridge,543,whib,2023-04-04,,,empty,"4/4: nest partially collapsed 4/15: nest gone 4/20: pulled flag" +2023,6th_bridge,543,whib,2023-04-15,,,empty,"4/4: nest partially collapsed 4/15: nest gone 4/20: pulled flag" +2023,6th_bridge,543,whib,2023-04-20,,,pulled,"4/4: nest partially collapsed 4/15: nest gone 4/20: pulled flag" +2023,6th_bridge,543,whib,2023-04-27,,,,"4/4: nest partially collapsed 4/15: nest gone 4/20: pulled flag" +2023,6th_bridge,543,whib,2023-05-03,,,,"4/4: nest partially collapsed 4/15: nest gone 4/20: pulled flag" +2023,6th_bridge,545,whib,2023-02-22,,,, +2023,6th_bridge,545,whib,2023-03-01,,,, +2023,6th_bridge,545,whib,2023-03-08,,,, +2023,6th_bridge,545,whib,2023-03-14,,,, +2023,6th_bridge,545,whib,2023-03-21,2,,incubating, +2023,6th_bridge,545,whib,2023-03-28,2,,incubating, +2023,6th_bridge,545,whib,2023-04-04,,,empty, +2023,6th_bridge,545,whib,2023-04-15,,,, +2023,6th_bridge,545,whib,2023-04-20,,,, +2023,6th_bridge,545,whib,2023-04-27,,,, +2023,6th_bridge,545,whib,2023-05-03,,,, +2023,6th_bridge,*545,glib,2023-02-22,,,,"4/27: Flag pulled" +2023,6th_bridge,*545,glib,2023-03-01,,,,"4/27: Flag pulled" +2023,6th_bridge,*545,glib,2023-03-08,,,,"4/27: Flag pulled" +2023,6th_bridge,*545,glib,2023-03-14,,,,"4/27: Flag pulled" +2023,6th_bridge,*545,glib,2023-03-21,,,,"4/27: Flag pulled" +2023,6th_bridge,*545,glib,2023-03-28,,,,"4/27: Flag pulled" +2023,6th_bridge,*545,glib,2023-04-04,1,,incubating,"4/27: Flag pulled" +2023,6th_bridge,*545,glib,2023-04-15,3,,incubating,"4/27: Flag pulled" +2023,6th_bridge,*545,glib,2023-04-20,,,missed,"4/27: Flag pulled" +2023,6th_bridge,*545,glib,2023-04-27,,,empty,"4/27: Flag pulled" +2023,6th_bridge,*545,glib,2023-05-03,,,,"4/27: Flag pulled" +2023,6th_bridge,466,whib,2023-02-22,,,, +2023,6th_bridge,466,whib,2023-03-01,,,, +2023,6th_bridge,466,whib,2023-03-08,,,, +2023,6th_bridge,466,whib,2023-03-14,,,, +2023,6th_bridge,466,whib,2023-03-21,3,,incubating, +2023,6th_bridge,466,whib,2023-03-28,3,,incubating, +2023,6th_bridge,466,whib,2023-04-04,,,empty, +2023,6th_bridge,466,whib,2023-04-15,,,, +2023,6th_bridge,466,whib,2023-04-20,,,, +2023,6th_bridge,466,whib,2023-04-27,,,, +2023,6th_bridge,466,whib,2023-05-03,,,, +2023,6th_bridge,466,glib,2023-02-22,,,, +2023,6th_bridge,466,glib,2023-03-01,,,, +2023,6th_bridge,466,glib,2023-03-08,,,, +2023,6th_bridge,466,glib,2023-03-14,,,, +2023,6th_bridge,466,glib,2023-03-21,,,, +2023,6th_bridge,466,glib,2023-03-28,,,, +2023,6th_bridge,466,glib,2023-04-04,1,,incubating, +2023,6th_bridge,466,glib,2023-04-15,3,,incubating, +2023,6th_bridge,466,glib,2023-04-20,,,empty, +2023,6th_bridge,466,glib,2023-04-27,,,pulled, +2023,6th_bridge,466,glib,2023-05-03,,,, +2023,6th_bridge,468,whib,2023-02-22,,,,"4/27: Flag pulled" +2023,6th_bridge,468,whib,2023-03-01,,,,"4/27: Flag pulled" +2023,6th_bridge,468,whib,2023-03-08,,,,"4/27: Flag pulled" +2023,6th_bridge,468,whib,2023-03-14,,,,"4/27: Flag pulled" +2023,6th_bridge,468,whib,2023-03-21,2,,incubating,"4/27: Flag pulled" +2023,6th_bridge,468,whib,2023-03-28,2,,incubating,"4/27: Flag pulled" +2023,6th_bridge,468,whib,2023-04-04,2,,incubating,"4/27: Flag pulled" +2023,6th_bridge,468,whib,2023-04-15,,1,nestling,"4/27: Flag pulled" +2023,6th_bridge,468,whib,2023-04-20,,1,nestling,"4/27: Flag pulled" +2023,6th_bridge,468,whib,2023-04-27,,,empty,"4/27: Flag pulled" +2023,6th_bridge,468,whib,2023-05-03,,,,"4/27: Flag pulled" +2023,6th_bridge,547,whib,2023-02-22,,,,"4/20: pulled flag" +2023,6th_bridge,547,whib,2023-03-01,,,,"4/20: pulled flag" +2023,6th_bridge,547,whib,2023-03-08,,,,"4/20: pulled flag" +2023,6th_bridge,547,whib,2023-03-14,,,,"4/20: pulled flag" +2023,6th_bridge,547,whib,2023-03-21,3,,incubating,"4/20: pulled flag" +2023,6th_bridge,547,whib,2023-03-28,3,,incubating,"4/20: pulled flag" +2023,6th_bridge,547,whib,2023-04-04,3,,incubating,"4/20: pulled flag" +2023,6th_bridge,547,whib,2023-04-15,,,empty,"4/20: pulled flag" +2023,6th_bridge,547,whib,2023-04-20,,,pulled,"4/20: pulled flag" +2023,6th_bridge,547,whib,2023-04-27,,,,"4/20: pulled flag" +2023,6th_bridge,547,whib,2023-05-03,,,,"4/20: pulled flag" +2023,6th_bridge,549,whib,2023-02-22,,,, +2023,6th_bridge,549,whib,2023-03-01,,,, +2023,6th_bridge,549,whib,2023-03-08,,,, +2023,6th_bridge,549,whib,2023-03-14,,,, +2023,6th_bridge,549,whib,2023-03-21,2,,incubating, +2023,6th_bridge,549,whib,2023-03-28,1,,incubating, +2023,6th_bridge,549,whib,2023-04-04,1,,incubating, +2023,6th_bridge,549,whib,2023-04-15,1,,incubating, +2023,6th_bridge,549,whib,2023-04-20,,,empty, +2023,6th_bridge,549,whib,2023-04-27,,,pulled, +2023,6th_bridge,549,whib,2023-05-03,,,, +2023,6th_bridge,551,whib,2023-02-22,,,,"4/15: 1 dead chick in nest" +2023,6th_bridge,551,whib,2023-03-01,,,,"4/15: 1 dead chick in nest" +2023,6th_bridge,551,whib,2023-03-08,,,,"4/15: 1 dead chick in nest" +2023,6th_bridge,551,whib,2023-03-14,,,,"4/15: 1 dead chick in nest" +2023,6th_bridge,551,whib,2023-03-21,3,,incubating,"4/15: 1 dead chick in nest" +2023,6th_bridge,551,whib,2023-03-28,3,,incubating,"4/15: 1 dead chick in nest" +2023,6th_bridge,551,whib,2023-04-04,3,,incubating,"4/15: 1 dead chick in nest" +2023,6th_bridge,551,whib,2023-04-15,,2,nestling,"4/15: 1 dead chick in nest" +2023,6th_bridge,551,whib,2023-04-20,,,empty,"4/15: 1 dead chick in nest" +2023,6th_bridge,551,whib,2023-04-27,,,pulled,"4/15: 1 dead chick in nest" +2023,6th_bridge,551,whib,2023-05-03,,,,"4/15: 1 dead chick in nest" +2023,6th_bridge,553,whib,2023-02-22,,,,"4/20: pulled flag" +2023,6th_bridge,553,whib,2023-03-01,,,,"4/20: pulled flag" +2023,6th_bridge,553,whib,2023-03-08,,,,"4/20: pulled flag" +2023,6th_bridge,553,whib,2023-03-14,,,,"4/20: pulled flag" +2023,6th_bridge,553,whib,2023-03-21,2,,incubating,"4/20: pulled flag" +2023,6th_bridge,553,whib,2023-03-28,2,,incubating,"4/20: pulled flag" +2023,6th_bridge,553,whib,2023-04-04,2,,incubating,"4/20: pulled flag" +2023,6th_bridge,553,whib,2023-04-15,,,empty,"4/20: pulled flag" +2023,6th_bridge,553,whib,2023-04-20,,,pulled,"4/20: pulled flag" +2023,6th_bridge,553,whib,2023-04-27,,,,"4/20: pulled flag" +2023,6th_bridge,553,whib,2023-05-03,,,,"4/20: pulled flag" +2023,6th_bridge,555,whib,2023-02-22,,,,"3/28: 2 eggs below the nest, look ripped open" +2023,6th_bridge,555,whib,2023-03-01,,,,"3/28: 2 eggs below the nest, look ripped open" +2023,6th_bridge,555,whib,2023-03-08,,,,"3/28: 2 eggs below the nest, look ripped open" +2023,6th_bridge,555,whib,2023-03-14,,,,"3/28: 2 eggs below the nest, look ripped open" +2023,6th_bridge,555,whib,2023-03-21,2,,incubating,"3/28: 2 eggs below the nest, look ripped open" +2023,6th_bridge,555,whib,2023-03-28,,,empty,"3/28: 2 eggs below the nest, look ripped open" +2023,6th_bridge,555,whib,2023-04-04,,,,"3/28: 2 eggs below the nest, look ripped open" +2023,6th_bridge,555,whib,2023-04-15,,,,"3/28: 2 eggs below the nest, look ripped open" +2023,6th_bridge,555,whib,2023-04-20,,,,"3/28: 2 eggs below the nest, look ripped open" +2023,6th_bridge,555,whib,2023-04-27,,,,"3/28: 2 eggs below the nest, look ripped open" +2023,6th_bridge,555,whib,2023-05-03,,,,"3/28: 2 eggs below the nest, look ripped open" +2023,6th_bridge,*555,glib,2023-02-22,,,,"4/20: pulled flag" +2023,6th_bridge,*555,glib,2023-03-01,,,,"4/20: pulled flag" +2023,6th_bridge,*555,glib,2023-03-08,,,,"4/20: pulled flag" +2023,6th_bridge,*555,glib,2023-03-14,,,,"4/20: pulled flag" +2023,6th_bridge,*555,glib,2023-03-21,,,,"4/20: pulled flag" +2023,6th_bridge,*555,glib,2023-03-28,,,,"4/20: pulled flag" +2023,6th_bridge,*555,glib,2023-04-04,1,,incubating,"4/20: pulled flag" +2023,6th_bridge,*555,glib,2023-04-15,,,empty,"4/20: pulled flag" +2023,6th_bridge,*555,glib,2023-04-20,,,pulled,"4/20: pulled flag" +2023,6th_bridge,*555,glib,2023-04-27,,,,"4/20: pulled flag" +2023,6th_bridge,*555,glib,2023-05-03,,,,"4/20: pulled flag" +2023,6th_bridge,470,glib,2023-02-22,,,,"3/21: odd, low nest below 139, egg cold; 4/27: old predated egg" +2023,6th_bridge,470,glib,2023-03-01,,,,"3/21: odd, low nest below 139, egg cold; 4/27: old predated egg" +2023,6th_bridge,470,glib,2023-03-08,,,,"3/21: odd, low nest below 139, egg cold; 4/27: old predated egg" +2023,6th_bridge,470,glib,2023-03-14,,,,"3/21: odd, low nest below 139, egg cold; 4/27: old predated egg" +2023,6th_bridge,470,glib,2023-03-21,1,,incubating,"3/21: odd, low nest below 139, egg cold; 4/27: old predated egg" +2023,6th_bridge,470,glib,2023-03-28,3,,incubating,"3/21: odd, low nest below 139, egg cold; 4/27: old predated egg" +2023,6th_bridge,470,glib,2023-04-04,3,,incubating,"3/21: odd, low nest below 139, egg cold; 4/27: old predated egg" +2023,6th_bridge,470,glib,2023-04-15,2,1,chick_dry,"3/21: odd, low nest below 139, egg cold; 4/27: old predated egg" +2023,6th_bridge,470,glib,2023-04-20,,,empty,"3/21: odd, low nest below 139, egg cold; 4/27: old predated egg" +2023,6th_bridge,470,glib,2023-04-27,,,pulled,"3/21: odd, low nest below 139, egg cold; 4/27: old predated egg" +2023,6th_bridge,470,glib,2023-05-03,,,,"3/21: odd, low nest below 139, egg cold; 4/27: old predated egg" +2023,6th_bridge,557,whib,2023-02-22,,,,"4/27: Flag pulled" +2023,6th_bridge,557,whib,2023-03-01,,,,"4/27: Flag pulled" +2023,6th_bridge,557,whib,2023-03-08,,,,"4/27: Flag pulled" +2023,6th_bridge,557,whib,2023-03-14,,,,"4/27: Flag pulled" +2023,6th_bridge,557,whib,2023-03-21,2,,incubating,"4/27: Flag pulled" +2023,6th_bridge,557,whib,2023-03-28,2,,incubating,"4/27: Flag pulled" +2023,6th_bridge,557,whib,2023-04-04,2,,incubating,"4/27: Flag pulled" +2023,6th_bridge,557,whib,2023-04-15,,1,nestling,"4/27: Flag pulled" +2023,6th_bridge,557,whib,2023-04-20,,1,nestling,"4/27: Flag pulled" +2023,6th_bridge,557,whib,2023-04-27,,,empty,"4/27: Flag pulled" +2023,6th_bridge,557,whib,2023-05-03,,,,"4/27: Flag pulled" +2023,6th_bridge,472,whib,2023-02-22,,,,"4/15: 1 dead chick in nest 4/20: pulled flag" +2023,6th_bridge,472,whib,2023-03-01,,,,"4/15: 1 dead chick in nest 4/20: pulled flag" +2023,6th_bridge,472,whib,2023-03-08,,,,"4/15: 1 dead chick in nest 4/20: pulled flag" +2023,6th_bridge,472,whib,2023-03-14,,,,"4/15: 1 dead chick in nest 4/20: pulled flag" +2023,6th_bridge,472,whib,2023-03-21,2,,incubating,"4/15: 1 dead chick in nest 4/20: pulled flag" +2023,6th_bridge,472,whib,2023-03-28,2,,incubating,"4/15: 1 dead chick in nest 4/20: pulled flag" +2023,6th_bridge,472,whib,2023-04-04,2,,incubating,"4/15: 1 dead chick in nest 4/20: pulled flag" +2023,6th_bridge,472,whib,2023-04-15,,1,nestling,"4/15: 1 dead chick in nest 4/20: pulled flag" +2023,6th_bridge,472,whib,2023-04-20,,,empty,"4/15: 1 dead chick in nest 4/20: pulled flag" +2023,6th_bridge,472,whib,2023-04-27,,,,"4/15: 1 dead chick in nest 4/20: pulled flag" +2023,6th_bridge,472,whib,2023-05-03,,,,"4/15: 1 dead chick in nest 4/20: pulled flag" +2023,6th_bridge,474,whib,2023-02-22,,,,"4/20: pulled flag" +2023,6th_bridge,474,whib,2023-03-01,,,,"4/20: pulled flag" +2023,6th_bridge,474,whib,2023-03-08,,,,"4/20: pulled flag" +2023,6th_bridge,474,whib,2023-03-14,,,,"4/20: pulled flag" +2023,6th_bridge,474,whib,2023-03-21,2,,incubating,"4/20: pulled flag" +2023,6th_bridge,474,whib,2023-03-28,2,,incubating,"4/20: pulled flag" +2023,6th_bridge,474,whib,2023-04-04,2,,incubating,"4/20: pulled flag" +2023,6th_bridge,474,whib,2023-04-15,,1,nestling,"4/20: pulled flag" +2023,6th_bridge,474,whib,2023-04-20,,,empty,"4/20: pulled flag" +2023,6th_bridge,474,whib,2023-04-27,,,,"4/20: pulled flag" +2023,6th_bridge,474,whib,2023-05-03,,,,"4/20: pulled flag" +2023,6th_bridge,476,whib,2023-02-22,,,,"3/28: one predated egg in nest 4/20: pulled flag" +2023,6th_bridge,476,whib,2023-03-01,,,,"3/28: one predated egg in nest 4/20: pulled flag" +2023,6th_bridge,476,whib,2023-03-08,,,,"3/28: one predated egg in nest 4/20: pulled flag" +2023,6th_bridge,476,whib,2023-03-14,,,,"3/28: one predated egg in nest 4/20: pulled flag" +2023,6th_bridge,476,whib,2023-03-21,3,,incubating,"3/28: one predated egg in nest 4/20: pulled flag" +2023,6th_bridge,476,whib,2023-03-28,2,,incubating,"3/28: one predated egg in nest 4/20: pulled flag" +2023,6th_bridge,476,whib,2023-04-04,,,empty,"3/28: one predated egg in nest 4/20: pulled flag" +2023,6th_bridge,476,whib,2023-04-15,,,empty,"3/28: one predated egg in nest 4/20: pulled flag" +2023,6th_bridge,476,whib,2023-04-20,,,pulled,"3/28: one predated egg in nest 4/20: pulled flag" +2023,6th_bridge,476,whib,2023-04-27,,,,"3/28: one predated egg in nest 4/20: pulled flag" +2023,6th_bridge,476,whib,2023-05-03,,,,"3/28: one predated egg in nest 4/20: pulled flag" +2023,6th_bridge,478,whib,2023-02-22,,,,"3/28: 2 eggs predated in nest 4/15: nest gone 4/20: pulled flag" +2023,6th_bridge,478,whib,2023-03-01,,,,"3/28: 2 eggs predated in nest 4/15: nest gone 4/20: pulled flag" +2023,6th_bridge,478,whib,2023-03-08,,,,"3/28: 2 eggs predated in nest 4/15: nest gone 4/20: pulled flag" +2023,6th_bridge,478,whib,2023-03-14,,,,"3/28: 2 eggs predated in nest 4/15: nest gone 4/20: pulled flag" +2023,6th_bridge,478,whib,2023-03-21,2,,incubating,"3/28: 2 eggs predated in nest 4/15: nest gone 4/20: pulled flag" +2023,6th_bridge,478,whib,2023-03-28,,,empty,"3/28: 2 eggs predated in nest 4/15: nest gone 4/20: pulled flag" +2023,6th_bridge,478,whib,2023-04-04,,,empty,"3/28: 2 eggs predated in nest 4/15: nest gone 4/20: pulled flag" +2023,6th_bridge,478,whib,2023-04-15,,,empty,"3/28: 2 eggs predated in nest 4/15: nest gone 4/20: pulled flag" +2023,6th_bridge,478,whib,2023-04-20,,,pulled,"3/28: 2 eggs predated in nest 4/15: nest gone 4/20: pulled flag" +2023,6th_bridge,478,whib,2023-04-27,,,,"3/28: 2 eggs predated in nest 4/15: nest gone 4/20: pulled flag" +2023,6th_bridge,478,whib,2023-05-03,,,,"3/28: 2 eggs predated in nest 4/15: nest gone 4/20: pulled flag" +2023,6th_bridge,480,whib,2023-02-22,,,,"4/27: Flag pulled" +2023,6th_bridge,480,whib,2023-03-01,,,,"4/27: Flag pulled" +2023,6th_bridge,480,whib,2023-03-08,,,,"4/27: Flag pulled" +2023,6th_bridge,480,whib,2023-03-14,,,,"4/27: Flag pulled" +2023,6th_bridge,480,whib,2023-03-21,1,,incubating,"4/27: Flag pulled" +2023,6th_bridge,480,whib,2023-03-28,1,,incubating,"4/27: Flag pulled" +2023,6th_bridge,480,whib,2023-04-04,1,,incubating,"4/27: Flag pulled" +2023,6th_bridge,480,whib,2023-04-15,,1,nestling,"4/27: Flag pulled" +2023,6th_bridge,480,whib,2023-04-20,,1,nestling,"4/27: Flag pulled" +2023,6th_bridge,480,whib,2023-04-27,,,empty,"4/27: Flag pulled" +2023,6th_bridge,480,whib,2023-05-03,,,,"4/27: Flag pulled" +2023,6th_bridge,482,trhe,2023-02-22,,,,"5/3: flag pulled" +2023,6th_bridge,482,trhe,2023-03-01,,,,"5/3: flag pulled" +2023,6th_bridge,482,trhe,2023-03-08,,,,"5/3: flag pulled" +2023,6th_bridge,482,trhe,2023-03-14,,,,"5/3: flag pulled" +2023,6th_bridge,482,trhe,2023-03-21,4,,incubating,"5/3: flag pulled" +2023,6th_bridge,482,trhe,2023-03-28,4,,incubating,"5/3: flag pulled" +2023,6th_bridge,482,trhe,2023-04-04,4,,incubating,"5/3: flag pulled" +2023,6th_bridge,482,trhe,2023-04-15,,3,nestling,"5/3: flag pulled" +2023,6th_bridge,482,trhe,2023-04-20,,3,nestling,"5/3: flag pulled" +2023,6th_bridge,482,trhe,2023-04-27,,,missed,"5/3: flag pulled" +2023,6th_bridge,482,trhe,2023-05-03,,,empty,"5/3: flag pulled" +2023,6th_bridge,484,whib,2023-02-22,,,,"3/28: 2 predated eggs 4/20: pulled flag" +2023,6th_bridge,484,whib,2023-03-01,,,,"3/28: 2 predated eggs 4/20: pulled flag" +2023,6th_bridge,484,whib,2023-03-08,,,,"3/28: 2 predated eggs 4/20: pulled flag" +2023,6th_bridge,484,whib,2023-03-14,,,,"3/28: 2 predated eggs 4/20: pulled flag" +2023,6th_bridge,484,whib,2023-03-21,3,,incubating,"3/28: 2 predated eggs 4/20: pulled flag" +2023,6th_bridge,484,whib,2023-03-28,1,,incubating,"3/28: 2 predated eggs 4/20: pulled flag" +2023,6th_bridge,484,whib,2023-04-04,,,empty,"3/28: 2 predated eggs 4/20: pulled flag" +2023,6th_bridge,484,whib,2023-04-15,,,empty,"3/28: 2 predated eggs 4/20: pulled flag" +2023,6th_bridge,484,whib,2023-04-20,,,pulled,"3/28: 2 predated eggs 4/20: pulled flag" +2023,6th_bridge,484,whib,2023-04-27,,,,"3/28: 2 predated eggs 4/20: pulled flag" +2023,6th_bridge,484,whib,2023-05-03,,,,"3/28: 2 predated eggs 4/20: pulled flag" +2023,6th_bridge,486,glib,2023-02-22,,,,"4/20: pulled flag" +2023,6th_bridge,486,glib,2023-03-01,,,,"4/20: pulled flag" +2023,6th_bridge,486,glib,2023-03-08,,,,"4/20: pulled flag" +2023,6th_bridge,486,glib,2023-03-14,,,,"4/20: pulled flag" +2023,6th_bridge,486,glib,2023-03-21,1,,incubating,"4/20: pulled flag" +2023,6th_bridge,486,glib,2023-03-28,,,empty,"4/20: pulled flag" +2023,6th_bridge,486,glib,2023-04-04,,,empty,"4/20: pulled flag" +2023,6th_bridge,486,glib,2023-04-15,,,empty,"4/20: pulled flag" +2023,6th_bridge,486,glib,2023-04-20,,,pulled,"4/20: pulled flag" +2023,6th_bridge,486,glib,2023-04-27,,,,"4/20: pulled flag" +2023,6th_bridge,486,glib,2023-05-03,,,,"4/20: pulled flag" +2023,6th_bridge,488,smhe,2023-02-22,,,,"4/27: Flag pulled" +2023,6th_bridge,488,smhe,2023-03-01,,,,"4/27: Flag pulled" +2023,6th_bridge,488,smhe,2023-03-08,,,,"4/27: Flag pulled" +2023,6th_bridge,488,smhe,2023-03-14,,,,"4/27: Flag pulled" +2023,6th_bridge,488,smhe,2023-03-21,1,,incubating,"4/27: Flag pulled" +2023,6th_bridge,488,smhe,2023-03-28,4,,incubating,"4/27: Flag pulled" +2023,6th_bridge,488,smhe,2023-04-04,5,,incubating,"4/27: Flag pulled" +2023,6th_bridge,488,smhe,2023-04-15,5,,incubating,"4/27: Flag pulled" +2023,6th_bridge,488,smhe,2023-04-20,,,missed,"4/27: Flag pulled" +2023,6th_bridge,488,smhe,2023-04-27,,,empty,"4/27: Flag pulled" +2023,6th_bridge,488,smhe,2023-05-03,,,,"4/27: Flag pulled" +2023,6th_bridge,490,whib,2023-02-22,,,,"4/4: 2 eggs freshly predated, appeared very close to hatch (chicks still alive in broken eggs)" +2023,6th_bridge,490,whib,2023-03-01,,,,"4/4: 2 eggs freshly predated, appeared very close to hatch (chicks still alive in broken eggs)" +2023,6th_bridge,490,whib,2023-03-08,,,,"4/4: 2 eggs freshly predated, appeared very close to hatch (chicks still alive in broken eggs)" +2023,6th_bridge,490,whib,2023-03-14,,,,"4/4: 2 eggs freshly predated, appeared very close to hatch (chicks still alive in broken eggs)" +2023,6th_bridge,490,whib,2023-03-21,2,,incubating,"4/4: 2 eggs freshly predated, appeared very close to hatch (chicks still alive in broken eggs)" +2023,6th_bridge,490,whib,2023-03-28,2,,incubating,"4/4: 2 eggs freshly predated, appeared very close to hatch (chicks still alive in broken eggs)" +2023,6th_bridge,490,whib,2023-04-04,,,empty,"4/4: 2 eggs freshly predated, appeared very close to hatch (chicks still alive in broken eggs)" +2023,6th_bridge,490,whib,2023-04-15,,,empty,"4/4: 2 eggs freshly predated, appeared very close to hatch (chicks still alive in broken eggs)" +2023,6th_bridge,490,whib,2023-04-20,,,empty,"4/4: 2 eggs freshly predated, appeared very close to hatch (chicks still alive in broken eggs)" +2023,6th_bridge,490,whib,2023-04-27,,,pulled,"4/4: 2 eggs freshly predated, appeared very close to hatch (chicks still alive in broken eggs)" +2023,6th_bridge,490,whib,2023-05-03,,,,"4/4: 2 eggs freshly predated, appeared very close to hatch (chicks still alive in broken eggs)" +2023,6th_bridge,492,trhe,2023-02-22,,,,"4/15: certain 3 chicks; 4/27: Flag pulled" +2023,6th_bridge,492,trhe,2023-03-01,,,,"4/15: certain 3 chicks; 4/27: Flag pulled" +2023,6th_bridge,492,trhe,2023-03-08,,,,"4/15: certain 3 chicks; 4/27: Flag pulled" +2023,6th_bridge,492,trhe,2023-03-14,,,,"4/15: certain 3 chicks; 4/27: Flag pulled" +2023,6th_bridge,492,trhe,2023-03-21,3,,incubating,"4/15: certain 3 chicks; 4/27: Flag pulled" +2023,6th_bridge,492,trhe,2023-03-28,3,,incubating,"4/15: certain 3 chicks; 4/27: Flag pulled" +2023,6th_bridge,492,trhe,2023-04-04,3,,incubating,"4/15: certain 3 chicks; 4/27: Flag pulled" +2023,6th_bridge,492,trhe,2023-04-15,,3,nestling,"4/15: certain 3 chicks; 4/27: Flag pulled" +2023,6th_bridge,492,trhe,2023-04-20,,2,nestling,"4/15: certain 3 chicks; 4/27: Flag pulled" +2023,6th_bridge,492,trhe,2023-04-27,,,empty,"4/15: certain 3 chicks; 4/27: Flag pulled" +2023,6th_bridge,492,trhe,2023-05-03,,,,"4/15: certain 3 chicks; 4/27: Flag pulled" +2023,6th_bridge,494,whib,2023-02-22,,,,"4/15: egg on ground" +2023,6th_bridge,494,whib,2023-03-01,,,,"4/15: egg on ground" +2023,6th_bridge,494,whib,2023-03-08,,,,"4/15: egg on ground" +2023,6th_bridge,494,whib,2023-03-14,,,,"4/15: egg on ground" +2023,6th_bridge,494,whib,2023-03-21,2,,incubating,"4/15: egg on ground" +2023,6th_bridge,494,whib,2023-03-28,2,,incubating,"4/15: egg on ground" +2023,6th_bridge,494,whib,2023-04-04,2,,incubating,"4/15: egg on ground" +2023,6th_bridge,494,whib,2023-04-15,,,empty,"4/15: egg on ground" +2023,6th_bridge,494,whib,2023-04-20,,,empty,"4/15: egg on ground" +2023,6th_bridge,494,whib,2023-04-27,,,pulled,"4/15: egg on ground" +2023,6th_bridge,494,whib,2023-05-03,,,,"4/15: egg on ground" +2023,6th_bridge,496,whib,2023-02-22,,,, +2023,6th_bridge,496,whib,2023-03-01,,,, +2023,6th_bridge,496,whib,2023-03-08,,,, +2023,6th_bridge,496,whib,2023-03-14,,,, +2023,6th_bridge,496,whib,2023-03-21,1,,incubating, +2023,6th_bridge,496,whib,2023-03-28,2,,incubating, +2023,6th_bridge,496,whib,2023-04-04,1,,incubating, +2023,6th_bridge,496,whib,2023-04-15,,,empty, +2023,6th_bridge,496,whib,2023-04-20,,,empty, +2023,6th_bridge,496,whib,2023-04-27,,,pulled, +2023,6th_bridge,496,whib,2023-05-03,,,, +2023,6th_bridge,498,whib,2023-02-22,,,,"4/15: big chick" +2023,6th_bridge,498,whib,2023-03-01,,,,"4/15: big chick" +2023,6th_bridge,498,whib,2023-03-08,,,,"4/15: big chick" +2023,6th_bridge,498,whib,2023-03-14,,,,"4/15: big chick" +2023,6th_bridge,498,whib,2023-03-21,2,,incubating,"4/15: big chick" +2023,6th_bridge,498,whib,2023-03-28,2,,incubating,"4/15: big chick" +2023,6th_bridge,498,whib,2023-04-04,2,,incubating,"4/15: big chick" +2023,6th_bridge,498,whib,2023-04-15,,1,nestling,"4/15: big chick" +2023,6th_bridge,498,whib,2023-04-20,,,empty,"4/15: big chick" +2023,6th_bridge,498,whib,2023-04-27,,,pulled,"4/15: big chick" +2023,6th_bridge,498,whib,2023-05-03,,,,"4/15: big chick" +2023,6th_bridge,500,whib,2023-02-22,,,,"4/15: both chicks dry; 4/27: Flag pulled" +2023,6th_bridge,500,whib,2023-03-01,,,,"4/15: both chicks dry; 4/27: Flag pulled" +2023,6th_bridge,500,whib,2023-03-08,,,,"4/15: both chicks dry; 4/27: Flag pulled" +2023,6th_bridge,500,whib,2023-03-14,,,,"4/15: both chicks dry; 4/27: Flag pulled" +2023,6th_bridge,500,whib,2023-03-21,2,,incubating,"4/15: both chicks dry; 4/27: Flag pulled" +2023,6th_bridge,500,whib,2023-03-28,2,,incubating,"4/15: both chicks dry; 4/27: Flag pulled" +2023,6th_bridge,500,whib,2023-04-04,2,,incubating,"4/15: both chicks dry; 4/27: Flag pulled" +2023,6th_bridge,500,whib,2023-04-15,,2,chick_dry,"4/15: both chicks dry; 4/27: Flag pulled" +2023,6th_bridge,500,whib,2023-04-20,,,missed,"4/15: both chicks dry; 4/27: Flag pulled" +2023,6th_bridge,500,whib,2023-04-27,,,empty,"4/15: both chicks dry; 4/27: Flag pulled" +2023,6th_bridge,500,whib,2023-05-03,,,,"4/15: both chicks dry; 4/27: Flag pulled" +2023,6th_bridge,502,whib,2023-02-22,,,,"4/4: 2 eggs predated, doesn't appear fresh 4/15: nest gone" +2023,6th_bridge,502,whib,2023-03-01,,,,"4/4: 2 eggs predated, doesn't appear fresh 4/15: nest gone" +2023,6th_bridge,502,whib,2023-03-08,,,,"4/4: 2 eggs predated, doesn't appear fresh 4/15: nest gone" +2023,6th_bridge,502,whib,2023-03-14,,,,"4/4: 2 eggs predated, doesn't appear fresh 4/15: nest gone" +2023,6th_bridge,502,whib,2023-03-21,2,,incubating,"4/4: 2 eggs predated, doesn't appear fresh 4/15: nest gone" +2023,6th_bridge,502,whib,2023-03-28,2,,incubating,"4/4: 2 eggs predated, doesn't appear fresh 4/15: nest gone" +2023,6th_bridge,502,whib,2023-04-04,,,empty,"4/4: 2 eggs predated, doesn't appear fresh 4/15: nest gone" +2023,6th_bridge,502,whib,2023-04-15,,,empty,"4/4: 2 eggs predated, doesn't appear fresh 4/15: nest gone" +2023,6th_bridge,502,whib,2023-04-20,,,,"4/4: 2 eggs predated, doesn't appear fresh 4/15: nest gone" +2023,6th_bridge,502,whib,2023-04-27,,,pulled,"4/4: 2 eggs predated, doesn't appear fresh 4/15: nest gone" +2023,6th_bridge,502,whib,2023-05-03,,,,"4/4: 2 eggs predated, doesn't appear fresh 4/15: nest gone" +2023,6th_bridge,504,whib,2023-02-22,,,,"4/20: found 1 chick running out of 504-510 cluster, chick fell and was picked up, put back into 510 nest ; 5/3: 1 very lively chick in tree tops above nest group 504-512" +2023,6th_bridge,504,whib,2023-03-01,,,,"4/20: found 1 chick running out of 504-510 cluster, chick fell and was picked up, put back into 510 nest ; 5/3: 1 very lively chick in tree tops above nest group 504-512" +2023,6th_bridge,504,whib,2023-03-08,,,,"4/20: found 1 chick running out of 504-510 cluster, chick fell and was picked up, put back into 510 nest ; 5/3: 1 very lively chick in tree tops above nest group 504-512" +2023,6th_bridge,504,whib,2023-03-14,,,,"4/20: found 1 chick running out of 504-510 cluster, chick fell and was picked up, put back into 510 nest ; 5/3: 1 very lively chick in tree tops above nest group 504-512" +2023,6th_bridge,504,whib,2023-03-21,3,,incubating,"4/20: found 1 chick running out of 504-510 cluster, chick fell and was picked up, put back into 510 nest ; 5/3: 1 very lively chick in tree tops above nest group 504-512" +2023,6th_bridge,504,whib,2023-03-28,3,,incubating,"4/20: found 1 chick running out of 504-510 cluster, chick fell and was picked up, put back into 510 nest ; 5/3: 1 very lively chick in tree tops above nest group 504-512" +2023,6th_bridge,504,whib,2023-04-04,3,,incubating,"4/20: found 1 chick running out of 504-510 cluster, chick fell and was picked up, put back into 510 nest ; 5/3: 1 very lively chick in tree tops above nest group 504-512" +2023,6th_bridge,504,whib,2023-04-15,,1,nestling,"4/20: found 1 chick running out of 504-510 cluster, chick fell and was picked up, put back into 510 nest ; 5/3: 1 very lively chick in tree tops above nest group 504-512" +2023,6th_bridge,504,whib,2023-04-20,,,empty,"4/20: found 1 chick running out of 504-510 cluster, chick fell and was picked up, put back into 510 nest ; 5/3: 1 very lively chick in tree tops above nest group 504-512" +2023,6th_bridge,504,whib,2023-04-27,,,empty,"4/20: found 1 chick running out of 504-510 cluster, chick fell and was picked up, put back into 510 nest ; 5/3: 1 very lively chick in tree tops above nest group 504-512" +2023,6th_bridge,504,whib,2023-05-03,,,pulled,"4/20: found 1 chick running out of 504-510 cluster, chick fell and was picked up, put back into 510 nest ; 5/3: 1 very lively chick in tree tops above nest group 504-512" +2023,6th_bridge,506,whib,2023-02-22,,,,"4/20: found 1 chick running out of 504-510 cluster, chick fell and was picked up, put back into 510 nest ; 5/3: 1 very lively chick in tree tops above nest group 504-512" +2023,6th_bridge,506,whib,2023-03-01,,,,"4/20: found 1 chick running out of 504-510 cluster, chick fell and was picked up, put back into 510 nest ; 5/3: 1 very lively chick in tree tops above nest group 504-512" +2023,6th_bridge,506,whib,2023-03-08,,,,"4/20: found 1 chick running out of 504-510 cluster, chick fell and was picked up, put back into 510 nest ; 5/3: 1 very lively chick in tree tops above nest group 504-512" +2023,6th_bridge,506,whib,2023-03-14,,,,"4/20: found 1 chick running out of 504-510 cluster, chick fell and was picked up, put back into 510 nest ; 5/3: 1 very lively chick in tree tops above nest group 504-512" +2023,6th_bridge,506,whib,2023-03-21,3,,incubating,"4/20: found 1 chick running out of 504-510 cluster, chick fell and was picked up, put back into 510 nest ; 5/3: 1 very lively chick in tree tops above nest group 504-512" +2023,6th_bridge,506,whib,2023-03-28,3,,incubating,"4/20: found 1 chick running out of 504-510 cluster, chick fell and was picked up, put back into 510 nest ; 5/3: 1 very lively chick in tree tops above nest group 504-512" +2023,6th_bridge,506,whib,2023-04-04,3,,incubating,"4/20: found 1 chick running out of 504-510 cluster, chick fell and was picked up, put back into 510 nest ; 5/3: 1 very lively chick in tree tops above nest group 504-512" +2023,6th_bridge,506,whib,2023-04-15,,1,nestling,"4/20: found 1 chick running out of 504-510 cluster, chick fell and was picked up, put back into 510 nest ; 5/3: 1 very lively chick in tree tops above nest group 504-512" +2023,6th_bridge,506,whib,2023-04-20,,,empty,"4/20: found 1 chick running out of 504-510 cluster, chick fell and was picked up, put back into 510 nest ; 5/3: 1 very lively chick in tree tops above nest group 504-512" +2023,6th_bridge,506,whib,2023-04-27,,,empty,"4/20: found 1 chick running out of 504-510 cluster, chick fell and was picked up, put back into 510 nest ; 5/3: 1 very lively chick in tree tops above nest group 504-512" +2023,6th_bridge,506,whib,2023-05-03,,,pulled,"4/20: found 1 chick running out of 504-510 cluster, chick fell and was picked up, put back into 510 nest ; 5/3: 1 very lively chick in tree tops above nest group 504-512" +2023,6th_bridge,508,whib,2023-02-22,,,,"4/20: found 1 chick running out of 504-510 cluster, chick fell and was picked up, put back into 510 nest ; 5/3: 1 very lively chick in tree tops above nest group 504-512" +2023,6th_bridge,508,whib,2023-03-01,,,,"4/20: found 1 chick running out of 504-510 cluster, chick fell and was picked up, put back into 510 nest ; 5/3: 1 very lively chick in tree tops above nest group 504-512" +2023,6th_bridge,508,whib,2023-03-08,,,,"4/20: found 1 chick running out of 504-510 cluster, chick fell and was picked up, put back into 510 nest ; 5/3: 1 very lively chick in tree tops above nest group 504-512" +2023,6th_bridge,508,whib,2023-03-14,,,,"4/20: found 1 chick running out of 504-510 cluster, chick fell and was picked up, put back into 510 nest ; 5/3: 1 very lively chick in tree tops above nest group 504-512" +2023,6th_bridge,508,whib,2023-03-21,2,,incubating,"4/20: found 1 chick running out of 504-510 cluster, chick fell and was picked up, put back into 510 nest ; 5/3: 1 very lively chick in tree tops above nest group 504-512" +2023,6th_bridge,508,whib,2023-03-28,2,,incubating,"4/20: found 1 chick running out of 504-510 cluster, chick fell and was picked up, put back into 510 nest ; 5/3: 1 very lively chick in tree tops above nest group 504-512" +2023,6th_bridge,508,whib,2023-04-04,1,,incubating,"4/20: found 1 chick running out of 504-510 cluster, chick fell and was picked up, put back into 510 nest ; 5/3: 1 very lively chick in tree tops above nest group 504-512" +2023,6th_bridge,508,whib,2023-04-15,,1,nestling,"4/20: found 1 chick running out of 504-510 cluster, chick fell and was picked up, put back into 510 nest ; 5/3: 1 very lively chick in tree tops above nest group 504-512" +2023,6th_bridge,508,whib,2023-04-20,,,empty,"4/20: found 1 chick running out of 504-510 cluster, chick fell and was picked up, put back into 510 nest ; 5/3: 1 very lively chick in tree tops above nest group 504-512" +2023,6th_bridge,508,whib,2023-04-27,,,pulled,"4/20: found 1 chick running out of 504-510 cluster, chick fell and was picked up, put back into 510 nest ; 5/3: 1 very lively chick in tree tops above nest group 504-512" +2023,6th_bridge,508,whib,2023-05-03,,,,"4/20: found 1 chick running out of 504-510 cluster, chick fell and was picked up, put back into 510 nest ; 5/3: 1 very lively chick in tree tops above nest group 504-512" +2023,6th_bridge,510,whib,2023-02-22,,,,"4/15: chick dry 4/20: found 1 chick running out of 504-510 cluster, chick fell and was picked up, put back into 510 nest ; 4/27: Chick big and very mobile, got onto ground as we passed by, but we did not chase; 5/3: 1 very lively chick in tree tops above nest group 504-512. Flag pulled" +2023,6th_bridge,510,whib,2023-03-01,,,,"4/15: chick dry 4/20: found 1 chick running out of 504-510 cluster, chick fell and was picked up, put back into 510 nest ; 4/27: Chick big and very mobile, got onto ground as we passed by, but we did not chase; 5/3: 1 very lively chick in tree tops above nest group 504-512. Flag pulled" +2023,6th_bridge,510,whib,2023-03-08,,,,"4/15: chick dry 4/20: found 1 chick running out of 504-510 cluster, chick fell and was picked up, put back into 510 nest ; 4/27: Chick big and very mobile, got onto ground as we passed by, but we did not chase; 5/3: 1 very lively chick in tree tops above nest group 504-512. Flag pulled" +2023,6th_bridge,510,whib,2023-03-14,,,,"4/15: chick dry 4/20: found 1 chick running out of 504-510 cluster, chick fell and was picked up, put back into 510 nest ; 4/27: Chick big and very mobile, got onto ground as we passed by, but we did not chase; 5/3: 1 very lively chick in tree tops above nest group 504-512. Flag pulled" +2023,6th_bridge,510,whib,2023-03-21,2,,incubating,"4/15: chick dry 4/20: found 1 chick running out of 504-510 cluster, chick fell and was picked up, put back into 510 nest ; 4/27: Chick big and very mobile, got onto ground as we passed by, but we did not chase; 5/3: 1 very lively chick in tree tops above nest group 504-512. Flag pulled" +2023,6th_bridge,510,whib,2023-03-28,2,,incubating,"4/15: chick dry 4/20: found 1 chick running out of 504-510 cluster, chick fell and was picked up, put back into 510 nest ; 4/27: Chick big and very mobile, got onto ground as we passed by, but we did not chase; 5/3: 1 very lively chick in tree tops above nest group 504-512. Flag pulled" +2023,6th_bridge,510,whib,2023-04-04,2,,incubating,"4/15: chick dry 4/20: found 1 chick running out of 504-510 cluster, chick fell and was picked up, put back into 510 nest ; 4/27: Chick big and very mobile, got onto ground as we passed by, but we did not chase; 5/3: 1 very lively chick in tree tops above nest group 504-512. Flag pulled" +2023,6th_bridge,510,whib,2023-04-15,,1,chick_dry,"4/15: chick dry 4/20: found 1 chick running out of 504-510 cluster, chick fell and was picked up, put back into 510 nest ; 4/27: Chick big and very mobile, got onto ground as we passed by, but we did not chase; 5/3: 1 very lively chick in tree tops above nest group 504-512. Flag pulled" +2023,6th_bridge,510,whib,2023-04-20,,,empty,"4/15: chick dry 4/20: found 1 chick running out of 504-510 cluster, chick fell and was picked up, put back into 510 nest ; 4/27: Chick big and very mobile, got onto ground as we passed by, but we did not chase; 5/3: 1 very lively chick in tree tops above nest group 504-512. Flag pulled" +2023,6th_bridge,510,whib,2023-04-27,,1,branchling,"4/15: chick dry 4/20: found 1 chick running out of 504-510 cluster, chick fell and was picked up, put back into 510 nest ; 4/27: Chick big and very mobile, got onto ground as we passed by, but we did not chase; 5/3: 1 very lively chick in tree tops above nest group 504-512. Flag pulled" +2023,6th_bridge,510,whib,2023-05-03,,1,branchling,"4/15: chick dry 4/20: found 1 chick running out of 504-510 cluster, chick fell and was picked up, put back into 510 nest ; 4/27: Chick big and very mobile, got onto ground as we passed by, but we did not chase; 5/3: 1 very lively chick in tree tops above nest group 504-512. Flag pulled" +2023,6th_bridge,512,whib,2023-02-22,,,,"4/15: nest gone; 5/3: 1 very lively chick in tree tops above nest group 504-512." +2023,6th_bridge,512,whib,2023-03-01,,,,"4/15: nest gone; 5/3: 1 very lively chick in tree tops above nest group 504-512." +2023,6th_bridge,512,whib,2023-03-08,,,,"4/15: nest gone; 5/3: 1 very lively chick in tree tops above nest group 504-512." +2023,6th_bridge,512,whib,2023-03-14,,,,"4/15: nest gone; 5/3: 1 very lively chick in tree tops above nest group 504-512." +2023,6th_bridge,512,whib,2023-03-21,3,,incubating,"4/15: nest gone; 5/3: 1 very lively chick in tree tops above nest group 504-512." +2023,6th_bridge,512,whib,2023-03-28,,,empty,"4/15: nest gone; 5/3: 1 very lively chick in tree tops above nest group 504-512." +2023,6th_bridge,512,whib,2023-04-04,,,empty,"4/15: nest gone; 5/3: 1 very lively chick in tree tops above nest group 504-512." +2023,6th_bridge,512,whib,2023-04-15,,,empty,"4/15: nest gone; 5/3: 1 very lively chick in tree tops above nest group 504-512." +2023,6th_bridge,512,whib,2023-04-20,,,,"4/15: nest gone; 5/3: 1 very lively chick in tree tops above nest group 504-512." +2023,6th_bridge,512,whib,2023-04-27,,,,"4/15: nest gone; 5/3: 1 very lively chick in tree tops above nest group 504-512." +2023,6th_bridge,512,whib,2023-05-03,,,pulled,"4/15: nest gone; 5/3: 1 very lively chick in tree tops above nest group 504-512." +2023,6th_bridge,575,whib,2023-02-22,,,,"4/15: nest gone" +2023,6th_bridge,575,whib,2023-03-01,,,,"4/15: nest gone" +2023,6th_bridge,575,whib,2023-03-08,,,,"4/15: nest gone" +2023,6th_bridge,575,whib,2023-03-14,,,,"4/15: nest gone" +2023,6th_bridge,575,whib,2023-03-21,,,,"4/15: nest gone" +2023,6th_bridge,575,whib,2023-03-28,2,,incubating,"4/15: nest gone" +2023,6th_bridge,575,whib,2023-04-04,1,,incubating,"4/15: nest gone" +2023,6th_bridge,575,whib,2023-04-15,,,empty,"4/15: nest gone" +2023,6th_bridge,575,whib,2023-04-20,,,,"4/15: nest gone" +2023,6th_bridge,575,whib,2023-04-27,,,pulled,"4/15: nest gone" +2023,6th_bridge,575,whib,2023-05-03,,,,"4/15: nest gone" +2023,6th_bridge,577,whib,2023-02-22,,,, +2023,6th_bridge,577,whib,2023-03-01,,,, +2023,6th_bridge,577,whib,2023-03-08,,,, +2023,6th_bridge,577,whib,2023-03-14,,,, +2023,6th_bridge,577,whib,2023-03-21,,,, +2023,6th_bridge,577,whib,2023-03-28,3,,incubating, +2023,6th_bridge,577,whib,2023-04-04,3,,incubating, +2023,6th_bridge,577,whib,2023-04-15,,3,nestling, +2023,6th_bridge,577,whib,2023-04-20,,,empty, +2023,6th_bridge,577,whib,2023-04-27,,,pulled, +2023,6th_bridge,577,whib,2023-05-03,,,, +2023,6th_bridge,579,smhe,2023-02-22,,,, +2023,6th_bridge,579,smhe,2023-03-01,,,, +2023,6th_bridge,579,smhe,2023-03-08,,,, +2023,6th_bridge,579,smhe,2023-03-14,,,, +2023,6th_bridge,579,smhe,2023-03-21,,,, +2023,6th_bridge,579,smhe,2023-03-28,4,,incubating, +2023,6th_bridge,579,smhe,2023-04-04,4,,incubating, +2023,6th_bridge,579,smhe,2023-04-15,,,missed, +2023,6th_bridge,579,smhe,2023-04-20,,,missed, +2023,6th_bridge,579,smhe,2023-04-27,,,pulled, +2023,6th_bridge,579,smhe,2023-05-03,,,, +2023,6th_bridge,581,glib,2023-02-22,,,,"4/15: both chicks dry 4/20: found 2 ibis chicks up in 454 nest , above and to the side of 581, presumably from 581" +2023,6th_bridge,581,glib,2023-03-01,,,,"4/15: both chicks dry 4/20: found 2 ibis chicks up in 454 nest , above and to the side of 581, presumably from 581" +2023,6th_bridge,581,glib,2023-03-08,,,,"4/15: both chicks dry 4/20: found 2 ibis chicks up in 454 nest , above and to the side of 581, presumably from 581" +2023,6th_bridge,581,glib,2023-03-14,,,,"4/15: both chicks dry 4/20: found 2 ibis chicks up in 454 nest , above and to the side of 581, presumably from 581" +2023,6th_bridge,581,glib,2023-03-21,,,,"4/15: both chicks dry 4/20: found 2 ibis chicks up in 454 nest , above and to the side of 581, presumably from 581" +2023,6th_bridge,581,glib,2023-03-28,3,,incubating,"4/15: both chicks dry 4/20: found 2 ibis chicks up in 454 nest , above and to the side of 581, presumably from 581" +2023,6th_bridge,581,glib,2023-04-04,,,missed,"4/15: both chicks dry 4/20: found 2 ibis chicks up in 454 nest , above and to the side of 581, presumably from 581" +2023,6th_bridge,581,glib,2023-04-15,1,2,chick_dry,"4/15: both chicks dry 4/20: found 2 ibis chicks up in 454 nest , above and to the side of 581, presumably from 581" +2023,6th_bridge,581,glib,2023-04-20,,2,nestling,"4/15: both chicks dry 4/20: found 2 ibis chicks up in 454 nest , above and to the side of 581, presumably from 581" +2023,6th_bridge,581,glib,2023-04-27,,,empty,"4/15: both chicks dry 4/20: found 2 ibis chicks up in 454 nest , above and to the side of 581, presumably from 581" +2023,6th_bridge,581,glib,2023-05-03,,,,"4/15: both chicks dry 4/20: found 2 ibis chicks up in 454 nest , above and to the side of 581, presumably from 581" +2023,6th_bridge,583,glib,2023-02-22,,,,"4/20: nest likely empty, GREG chick ran into nest, then a WHIB chick, wobbly WHIBs too close to really check nest ; 4/27: Flag pulled, partial collapse" +2023,6th_bridge,583,glib,2023-03-01,,,,"4/20: nest likely empty, GREG chick ran into nest, then a WHIB chick, wobbly WHIBs too close to really check nest ; 4/27: Flag pulled, partial collapse" +2023,6th_bridge,583,glib,2023-03-08,,,,"4/20: nest likely empty, GREG chick ran into nest, then a WHIB chick, wobbly WHIBs too close to really check nest ; 4/27: Flag pulled, partial collapse" +2023,6th_bridge,583,glib,2023-03-14,,,,"4/20: nest likely empty, GREG chick ran into nest, then a WHIB chick, wobbly WHIBs too close to really check nest ; 4/27: Flag pulled, partial collapse" +2023,6th_bridge,583,glib,2023-03-21,,,,"4/20: nest likely empty, GREG chick ran into nest, then a WHIB chick, wobbly WHIBs too close to really check nest ; 4/27: Flag pulled, partial collapse" +2023,6th_bridge,583,glib,2023-03-28,1,,incubating,"4/20: nest likely empty, GREG chick ran into nest, then a WHIB chick, wobbly WHIBs too close to really check nest ; 4/27: Flag pulled, partial collapse" +2023,6th_bridge,583,glib,2023-04-04,3,,incubating,"4/20: nest likely empty, GREG chick ran into nest, then a WHIB chick, wobbly WHIBs too close to really check nest ; 4/27: Flag pulled, partial collapse" +2023,6th_bridge,583,glib,2023-04-15,,,missed,"4/20: nest likely empty, GREG chick ran into nest, then a WHIB chick, wobbly WHIBs too close to really check nest ; 4/27: Flag pulled, partial collapse" +2023,6th_bridge,583,glib,2023-04-20,,,missed,"4/20: nest likely empty, GREG chick ran into nest, then a WHIB chick, wobbly WHIBs too close to really check nest ; 4/27: Flag pulled, partial collapse" +2023,6th_bridge,583,glib,2023-04-27,,,empty,"4/20: nest likely empty, GREG chick ran into nest, then a WHIB chick, wobbly WHIBs too close to really check nest ; 4/27: Flag pulled, partial collapse" +2023,6th_bridge,583,glib,2023-05-03,,,,"4/20: nest likely empty, GREG chick ran into nest, then a WHIB chick, wobbly WHIBs too close to really check nest ; 4/27: Flag pulled, partial collapse" +2023,6th_bridge,589,glib,2023-02-22,,,,"4/27: partial collapse" +2023,6th_bridge,589,glib,2023-03-01,,,,"4/27: partial collapse" +2023,6th_bridge,589,glib,2023-03-08,,,,"4/27: partial collapse" +2023,6th_bridge,589,glib,2023-03-14,,,,"4/27: partial collapse" +2023,6th_bridge,589,glib,2023-03-21,,,,"4/27: partial collapse" +2023,6th_bridge,589,glib,2023-03-28,2,,incubating,"4/27: partial collapse" +2023,6th_bridge,589,glib,2023-04-04,2,,incubating,"4/27: partial collapse" +2023,6th_bridge,589,glib,2023-04-15,1,1,hatching,"4/27: partial collapse" +2023,6th_bridge,589,glib,2023-04-20,,,empty,"4/27: partial collapse" +2023,6th_bridge,589,glib,2023-04-27,,,pulled,"4/27: partial collapse" +2023,6th_bridge,589,glib,2023-05-03,,,,"4/27: partial collapse" +2023,6th_bridge,585,whib,2023-02-22,,,,"4/4: 2 predated eggs 4/15: nest gone 4/20: pulled flag" +2023,6th_bridge,585,whib,2023-03-01,,,,"4/4: 2 predated eggs 4/15: nest gone 4/20: pulled flag" +2023,6th_bridge,585,whib,2023-03-08,,,,"4/4: 2 predated eggs 4/15: nest gone 4/20: pulled flag" +2023,6th_bridge,585,whib,2023-03-14,,,,"4/4: 2 predated eggs 4/15: nest gone 4/20: pulled flag" +2023,6th_bridge,585,whib,2023-03-21,,,,"4/4: 2 predated eggs 4/15: nest gone 4/20: pulled flag" +2023,6th_bridge,585,whib,2023-03-28,2,,incubating,"4/4: 2 predated eggs 4/15: nest gone 4/20: pulled flag" +2023,6th_bridge,585,whib,2023-04-04,,,empty,"4/4: 2 predated eggs 4/15: nest gone 4/20: pulled flag" +2023,6th_bridge,585,whib,2023-04-15,,,empty,"4/4: 2 predated eggs 4/15: nest gone 4/20: pulled flag" +2023,6th_bridge,585,whib,2023-04-20,,,pulled,"4/4: 2 predated eggs 4/15: nest gone 4/20: pulled flag" +2023,6th_bridge,585,whib,2023-04-27,,,,"4/4: 2 predated eggs 4/15: nest gone 4/20: pulled flag" +2023,6th_bridge,585,whib,2023-05-03,,,,"4/4: 2 predated eggs 4/15: nest gone 4/20: pulled flag" +2023,6th_bridge,587,glib,2023-02-22,,,,"4/15: third egg in nest looks freshly pecked, bloody 4/20: 3 broken eggs in nest, pulled flag" +2023,6th_bridge,587,glib,2023-03-01,,,,"4/15: third egg in nest looks freshly pecked, bloody 4/20: 3 broken eggs in nest, pulled flag" +2023,6th_bridge,587,glib,2023-03-08,,,,"4/15: third egg in nest looks freshly pecked, bloody 4/20: 3 broken eggs in nest, pulled flag" +2023,6th_bridge,587,glib,2023-03-14,,,,"4/15: third egg in nest looks freshly pecked, bloody 4/20: 3 broken eggs in nest, pulled flag" +2023,6th_bridge,587,glib,2023-03-21,,,,"4/15: third egg in nest looks freshly pecked, bloody 4/20: 3 broken eggs in nest, pulled flag" +2023,6th_bridge,587,glib,2023-03-28,1,,incubating,"4/15: third egg in nest looks freshly pecked, bloody 4/20: 3 broken eggs in nest, pulled flag" +2023,6th_bridge,587,glib,2023-04-04,3,,incubating,"4/15: third egg in nest looks freshly pecked, bloody 4/20: 3 broken eggs in nest, pulled flag" +2023,6th_bridge,587,glib,2023-04-15,2,,incubating,"4/15: third egg in nest looks freshly pecked, bloody 4/20: 3 broken eggs in nest, pulled flag" +2023,6th_bridge,587,glib,2023-04-20,,,empty,"4/15: third egg in nest looks freshly pecked, bloody 4/20: 3 broken eggs in nest, pulled flag" +2023,6th_bridge,587,glib,2023-04-27,,,,"4/15: third egg in nest looks freshly pecked, bloody 4/20: 3 broken eggs in nest, pulled flag" +2023,6th_bridge,587,glib,2023-05-03,,,,"4/15: third egg in nest looks freshly pecked, bloody 4/20: 3 broken eggs in nest, pulled flag" +2023,6th_bridge,591,glib,2023-02-22,,,,"3/28: nest flagged but contents not recorded in book 4/15: chicks small 4/20: 1 dead chick in nest; 4/27: Flag pulled" +2023,6th_bridge,591,glib,2023-03-01,,,,"3/28: nest flagged but contents not recorded in book 4/15: chicks small 4/20: 1 dead chick in nest; 4/27: Flag pulled" +2023,6th_bridge,591,glib,2023-03-08,,,,"3/28: nest flagged but contents not recorded in book 4/15: chicks small 4/20: 1 dead chick in nest; 4/27: Flag pulled" +2023,6th_bridge,591,glib,2023-03-14,,,,"3/28: nest flagged but contents not recorded in book 4/15: chicks small 4/20: 1 dead chick in nest; 4/27: Flag pulled" +2023,6th_bridge,591,glib,2023-03-21,,,,"3/28: nest flagged but contents not recorded in book 4/15: chicks small 4/20: 1 dead chick in nest; 4/27: Flag pulled" +2023,6th_bridge,591,glib,2023-03-28,,,missed,"3/28: nest flagged but contents not recorded in book 4/15: chicks small 4/20: 1 dead chick in nest; 4/27: Flag pulled" +2023,6th_bridge,591,glib,2023-04-04,3,,incubating,"3/28: nest flagged but contents not recorded in book 4/15: chicks small 4/20: 1 dead chick in nest; 4/27: Flag pulled" +2023,6th_bridge,591,glib,2023-04-15,1,2,hatching,"3/28: nest flagged but contents not recorded in book 4/15: chicks small 4/20: 1 dead chick in nest; 4/27: Flag pulled" +2023,6th_bridge,591,glib,2023-04-20,,1,nestling,"3/28: nest flagged but contents not recorded in book 4/15: chicks small 4/20: 1 dead chick in nest; 4/27: Flag pulled" +2023,6th_bridge,591,glib,2023-04-27,,,empty,"3/28: nest flagged but contents not recorded in book 4/15: chicks small 4/20: 1 dead chick in nest; 4/27: Flag pulled" +2023,6th_bridge,591,glib,2023-05-03,,,,"3/28: nest flagged but contents not recorded in book 4/15: chicks small 4/20: 1 dead chick in nest; 4/27: Flag pulled" +2023,6th_bridge,593,glib,2023-02-22,,,,"4/15: 1 egg pipping 4/20: pulled flag" +2023,6th_bridge,593,glib,2023-03-01,,,,"4/15: 1 egg pipping 4/20: pulled flag" +2023,6th_bridge,593,glib,2023-03-08,,,,"4/15: 1 egg pipping 4/20: pulled flag" +2023,6th_bridge,593,glib,2023-03-14,,,,"4/15: 1 egg pipping 4/20: pulled flag" +2023,6th_bridge,593,glib,2023-03-21,,,,"4/15: 1 egg pipping 4/20: pulled flag" +2023,6th_bridge,593,glib,2023-03-28,3,,incubating,"4/15: 1 egg pipping 4/20: pulled flag" +2023,6th_bridge,593,glib,2023-04-04,3,,incubating,"4/15: 1 egg pipping 4/20: pulled flag" +2023,6th_bridge,593,glib,2023-04-15,2,1,hatching,"4/15: 1 egg pipping 4/20: pulled flag" +2023,6th_bridge,593,glib,2023-04-20,,,empty,"4/15: 1 egg pipping 4/20: pulled flag" +2023,6th_bridge,593,glib,2023-04-27,,,,"4/15: 1 egg pipping 4/20: pulled flag" +2023,6th_bridge,593,glib,2023-05-03,,,,"4/15: 1 egg pipping 4/20: pulled flag" +2023,6th_bridge,599,glib,2023-02-22,,,,"4/15: chick dry, 1 egg pipping; 4/27: Flag pulled" +2023,6th_bridge,599,glib,2023-03-01,,,,"4/15: chick dry, 1 egg pipping; 4/27: Flag pulled" +2023,6th_bridge,599,glib,2023-03-08,,,,"4/15: chick dry, 1 egg pipping; 4/27: Flag pulled" +2023,6th_bridge,599,glib,2023-03-14,,,,"4/15: chick dry, 1 egg pipping; 4/27: Flag pulled" +2023,6th_bridge,599,glib,2023-03-21,,,,"4/15: chick dry, 1 egg pipping; 4/27: Flag pulled" +2023,6th_bridge,599,glib,2023-03-28,3,,incubating,"4/15: chick dry, 1 egg pipping; 4/27: Flag pulled" +2023,6th_bridge,599,glib,2023-04-04,3,,incubating,"4/15: chick dry, 1 egg pipping; 4/27: Flag pulled" +2023,6th_bridge,599,glib,2023-04-15,2,1,chick_dry,"4/15: chick dry, 1 egg pipping; 4/27: Flag pulled" +2023,6th_bridge,599,glib,2023-04-20,,1,nestling,"4/15: chick dry, 1 egg pipping; 4/27: Flag pulled" +2023,6th_bridge,599,glib,2023-04-27,,,empty,"4/15: chick dry, 1 egg pipping; 4/27: Flag pulled" +2023,6th_bridge,599,glib,2023-05-03,,,,"4/15: chick dry, 1 egg pipping; 4/27: Flag pulled" +2023,6th_bridge,601,bcnh,2023-02-22,,,, +2023,6th_bridge,601,bcnh,2023-03-01,,,, +2023,6th_bridge,601,bcnh,2023-03-08,,,, +2023,6th_bridge,601,bcnh,2023-03-14,,,, +2023,6th_bridge,601,bcnh,2023-03-21,,,, +2023,6th_bridge,601,bcnh,2023-03-28,1,,incubating, +2023,6th_bridge,601,bcnh,2023-04-04,,,missed, +2023,6th_bridge,601,bcnh,2023-04-15,,,empty, +2023,6th_bridge,601,bcnh,2023-04-20,,,empty, +2023,6th_bridge,601,bcnh,2023-04-27,,,pulled, +2023,6th_bridge,601,bcnh,2023-05-03,,,, +2023,6th_bridge,603,glib,2023-02-22,,,,"3/28: marked next to nest, rather than under; 4/27: Flag pulled" +2023,6th_bridge,603,glib,2023-03-01,,,,"3/28: marked next to nest, rather than under; 4/27: Flag pulled" +2023,6th_bridge,603,glib,2023-03-08,,,,"3/28: marked next to nest, rather than under; 4/27: Flag pulled" +2023,6th_bridge,603,glib,2023-03-14,,,,"3/28: marked next to nest, rather than under; 4/27: Flag pulled" +2023,6th_bridge,603,glib,2023-03-21,,,,"3/28: marked next to nest, rather than under; 4/27: Flag pulled" +2023,6th_bridge,603,glib,2023-03-28,3,,incubating,"3/28: marked next to nest, rather than under; 4/27: Flag pulled" +2023,6th_bridge,603,glib,2023-04-04,3,,incubating,"3/28: marked next to nest, rather than under; 4/27: Flag pulled" +2023,6th_bridge,603,glib,2023-04-15,1,1,hatching,"3/28: marked next to nest, rather than under; 4/27: Flag pulled" +2023,6th_bridge,603,glib,2023-04-20,,,missed,"3/28: marked next to nest, rather than under; 4/27: Flag pulled" +2023,6th_bridge,603,glib,2023-04-27,,,empty,"3/28: marked next to nest, rather than under; 4/27: Flag pulled" +2023,6th_bridge,603,glib,2023-05-03,,,,"3/28: marked next to nest, rather than under; 4/27: Flag pulled" +2023,6th_bridge,605,whib,2023-02-22,,,,"4/27: Flag pulled" +2023,6th_bridge,605,whib,2023-03-01,,,,"4/27: Flag pulled" +2023,6th_bridge,605,whib,2023-03-08,,,,"4/27: Flag pulled" +2023,6th_bridge,605,whib,2023-03-14,,,,"4/27: Flag pulled" +2023,6th_bridge,605,whib,2023-03-21,,,,"4/27: Flag pulled" +2023,6th_bridge,605,whib,2023-03-28,2,,incubating,"4/27: Flag pulled" +2023,6th_bridge,605,whib,2023-04-04,2,,incubating,"4/27: Flag pulled" +2023,6th_bridge,605,whib,2023-04-15,2,,incubating,"4/27: Flag pulled" +2023,6th_bridge,605,whib,2023-04-20,,,missed,"4/27: Flag pulled" +2023,6th_bridge,605,whib,2023-04-27,,,empty,"4/27: Flag pulled" +2023,6th_bridge,605,whib,2023-05-03,,,,"4/27: Flag pulled" +2023,6th_bridge,595,glib,2023-02-22,,,,"3/28: one WHIB egg fallen out of 476 WHIB nest, and rolled into 595, partially crushing one of the GLIB eggs in 595 4/4: 2 GLIB eggs and 1 WHIB egg still in nest, separated from each other in nest 4/20: pulled flag" +2023,6th_bridge,595,glib,2023-03-01,,,,"3/28: one WHIB egg fallen out of 476 WHIB nest, and rolled into 595, partially crushing one of the GLIB eggs in 595 4/4: 2 GLIB eggs and 1 WHIB egg still in nest, separated from each other in nest 4/20: pulled flag" +2023,6th_bridge,595,glib,2023-03-08,,,,"3/28: one WHIB egg fallen out of 476 WHIB nest, and rolled into 595, partially crushing one of the GLIB eggs in 595 4/4: 2 GLIB eggs and 1 WHIB egg still in nest, separated from each other in nest 4/20: pulled flag" +2023,6th_bridge,595,glib,2023-03-14,,,,"3/28: one WHIB egg fallen out of 476 WHIB nest, and rolled into 595, partially crushing one of the GLIB eggs in 595 4/4: 2 GLIB eggs and 1 WHIB egg still in nest, separated from each other in nest 4/20: pulled flag" +2023,6th_bridge,595,glib,2023-03-21,,,,"3/28: one WHIB egg fallen out of 476 WHIB nest, and rolled into 595, partially crushing one of the GLIB eggs in 595 4/4: 2 GLIB eggs and 1 WHIB egg still in nest, separated from each other in nest 4/20: pulled flag" +2023,6th_bridge,595,glib,2023-03-28,3,,incubating,"3/28: one WHIB egg fallen out of 476 WHIB nest, and rolled into 595, partially crushing one of the GLIB eggs in 595 4/4: 2 GLIB eggs and 1 WHIB egg still in nest, separated from each other in nest 4/20: pulled flag" +2023,6th_bridge,595,glib,2023-04-04,2,,incubating,"3/28: one WHIB egg fallen out of 476 WHIB nest, and rolled into 595, partially crushing one of the GLIB eggs in 595 4/4: 2 GLIB eggs and 1 WHIB egg still in nest, separated from each other in nest 4/20: pulled flag" +2023,6th_bridge,595,glib,2023-04-15,,,empty,"3/28: one WHIB egg fallen out of 476 WHIB nest, and rolled into 595, partially crushing one of the GLIB eggs in 595 4/4: 2 GLIB eggs and 1 WHIB egg still in nest, separated from each other in nest 4/20: pulled flag" +2023,6th_bridge,595,glib,2023-04-20,,,pulled,"3/28: one WHIB egg fallen out of 476 WHIB nest, and rolled into 595, partially crushing one of the GLIB eggs in 595 4/4: 2 GLIB eggs and 1 WHIB egg still in nest, separated from each other in nest 4/20: pulled flag" +2023,6th_bridge,595,glib,2023-04-27,,,,"3/28: one WHIB egg fallen out of 476 WHIB nest, and rolled into 595, partially crushing one of the GLIB eggs in 595 4/4: 2 GLIB eggs and 1 WHIB egg still in nest, separated from each other in nest 4/20: pulled flag" +2023,6th_bridge,595,glib,2023-05-03,,,,"3/28: one WHIB egg fallen out of 476 WHIB nest, and rolled into 595, partially crushing one of the GLIB eggs in 595 4/4: 2 GLIB eggs and 1 WHIB egg still in nest, separated from each other in nest 4/20: pulled flag" +2023,6th_bridge,607,whib,2023-02-22,,,,"4/4: 2 eggs predated; 4/27: 1 large WHIB chick nearby, could be from anywhere. Flag pulled" +2023,6th_bridge,607,whib,2023-03-01,,,,"4/4: 2 eggs predated; 4/27: 1 large WHIB chick nearby, could be from anywhere. Flag pulled" +2023,6th_bridge,607,whib,2023-03-08,,,,"4/4: 2 eggs predated; 4/27: 1 large WHIB chick nearby, could be from anywhere. Flag pulled" +2023,6th_bridge,607,whib,2023-03-14,,,,"4/4: 2 eggs predated; 4/27: 1 large WHIB chick nearby, could be from anywhere. Flag pulled" +2023,6th_bridge,607,whib,2023-03-21,,,,"4/4: 2 eggs predated; 4/27: 1 large WHIB chick nearby, could be from anywhere. Flag pulled" +2023,6th_bridge,607,whib,2023-03-28,3,,incubating,"4/4: 2 eggs predated; 4/27: 1 large WHIB chick nearby, could be from anywhere. Flag pulled" +2023,6th_bridge,607,whib,2023-04-04,,,empty,"4/4: 2 eggs predated; 4/27: 1 large WHIB chick nearby, could be from anywhere. Flag pulled" +2023,6th_bridge,607,whib,2023-04-15,,,empty,"4/4: 2 eggs predated; 4/27: 1 large WHIB chick nearby, could be from anywhere. Flag pulled" +2023,6th_bridge,607,whib,2023-04-20,,,missed,"4/4: 2 eggs predated; 4/27: 1 large WHIB chick nearby, could be from anywhere. Flag pulled" +2023,6th_bridge,607,whib,2023-04-27,,,empty,"4/4: 2 eggs predated; 4/27: 1 large WHIB chick nearby, could be from anywhere. Flag pulled" +2023,6th_bridge,607,whib,2023-05-03,,,,"4/4: 2 eggs predated; 4/27: 1 large WHIB chick nearby, could be from anywhere. Flag pulled" +2023,6th_bridge,609,whib,2023-02-22,,,,"3/28: likely 3 eggs to start, one on the ground, and one predated in the nest" +2023,6th_bridge,609,whib,2023-03-01,,,,"3/28: likely 3 eggs to start, one on the ground, and one predated in the nest" +2023,6th_bridge,609,whib,2023-03-08,,,,"3/28: likely 3 eggs to start, one on the ground, and one predated in the nest" +2023,6th_bridge,609,whib,2023-03-14,,,,"3/28: likely 3 eggs to start, one on the ground, and one predated in the nest" +2023,6th_bridge,609,whib,2023-03-21,,,,"3/28: likely 3 eggs to start, one on the ground, and one predated in the nest" +2023,6th_bridge,609,whib,2023-03-28,1,,incubating,"3/28: likely 3 eggs to start, one on the ground, and one predated in the nest" +2023,6th_bridge,609,whib,2023-04-04,,,empty,"3/28: likely 3 eggs to start, one on the ground, and one predated in the nest" +2023,6th_bridge,609,whib,2023-04-15,,,missed,"3/28: likely 3 eggs to start, one on the ground, and one predated in the nest" +2023,6th_bridge,609,whib,2023-04-20,,,empty,"3/28: likely 3 eggs to start, one on the ground, and one predated in the nest" +2023,6th_bridge,609,whib,2023-04-27,,,pulled,"3/28: likely 3 eggs to start, one on the ground, and one predated in the nest" +2023,6th_bridge,609,whib,2023-05-03,,,,"3/28: likely 3 eggs to start, one on the ground, and one predated in the nest" +2023,6th_bridge,624,whib,2023-02-22,,,,"4/20: pulled flag" +2023,6th_bridge,624,whib,2023-03-01,,,,"4/20: pulled flag" +2023,6th_bridge,624,whib,2023-03-08,,,,"4/20: pulled flag" +2023,6th_bridge,624,whib,2023-03-14,,,,"4/20: pulled flag" +2023,6th_bridge,624,whib,2023-03-21,,,,"4/20: pulled flag" +2023,6th_bridge,624,whib,2023-03-28,,,,"4/20: pulled flag" +2023,6th_bridge,624,whib,2023-04-04,1,,incubating,"4/20: pulled flag" +2023,6th_bridge,624,whib,2023-04-15,,,empty,"4/20: pulled flag" +2023,6th_bridge,624,whib,2023-04-20,,,pulled,"4/20: pulled flag" +2023,6th_bridge,624,whib,2023-04-27,,,,"4/20: pulled flag" +2023,6th_bridge,624,whib,2023-05-03,,,,"4/20: pulled flag" +2023,6th_bridge,626,glib,2023-02-22,,,,"4/20: 1 dead chick in nest, pulled flag" +2023,6th_bridge,626,glib,2023-03-01,,,,"4/20: 1 dead chick in nest, pulled flag" +2023,6th_bridge,626,glib,2023-03-08,,,,"4/20: 1 dead chick in nest, pulled flag" +2023,6th_bridge,626,glib,2023-03-14,,,,"4/20: 1 dead chick in nest, pulled flag" +2023,6th_bridge,626,glib,2023-03-21,,,,"4/20: 1 dead chick in nest, pulled flag" +2023,6th_bridge,626,glib,2023-03-28,,,,"4/20: 1 dead chick in nest, pulled flag" +2023,6th_bridge,626,glib,2023-04-04,2,,incubating,"4/20: 1 dead chick in nest, pulled flag" +2023,6th_bridge,626,glib,2023-04-15,,2,nestling,"4/20: 1 dead chick in nest, pulled flag" +2023,6th_bridge,626,glib,2023-04-20,,,empty,"4/20: 1 dead chick in nest, pulled flag" +2023,6th_bridge,626,glib,2023-04-27,,,,"4/20: 1 dead chick in nest, pulled flag" +2023,6th_bridge,626,glib,2023-05-03,,,,"4/20: 1 dead chick in nest, pulled flag" +2023,6th_bridge,628,whib,2023-02-22,,,,"4/27: Flag pulled" +2023,6th_bridge,628,whib,2023-03-01,,,,"4/27: Flag pulled" +2023,6th_bridge,628,whib,2023-03-08,,,,"4/27: Flag pulled" +2023,6th_bridge,628,whib,2023-03-14,,,,"4/27: Flag pulled" +2023,6th_bridge,628,whib,2023-03-21,,,,"4/27: Flag pulled" +2023,6th_bridge,628,whib,2023-03-28,,,,"4/27: Flag pulled" +2023,6th_bridge,628,whib,2023-04-04,2,,incubating,"4/27: Flag pulled" +2023,6th_bridge,628,whib,2023-04-15,,,missed,"4/27: Flag pulled" +2023,6th_bridge,628,whib,2023-04-20,,,missed,"4/27: Flag pulled" +2023,6th_bridge,628,whib,2023-04-27,,,empty,"4/27: Flag pulled" +2023,6th_bridge,628,whib,2023-05-03,,,,"4/27: Flag pulled" +2023,6th_bridge,630,glib,2023-02-22,,,,"4/20: pulled flag" +2023,6th_bridge,630,glib,2023-03-01,,,,"4/20: pulled flag" +2023,6th_bridge,630,glib,2023-03-08,,,,"4/20: pulled flag" +2023,6th_bridge,630,glib,2023-03-14,,,,"4/20: pulled flag" +2023,6th_bridge,630,glib,2023-03-21,,,,"4/20: pulled flag" +2023,6th_bridge,630,glib,2023-03-28,,,,"4/20: pulled flag" +2023,6th_bridge,630,glib,2023-04-04,1,,incubating,"4/20: pulled flag" +2023,6th_bridge,630,glib,2023-04-15,3,,incubating,"4/20: pulled flag" +2023,6th_bridge,630,glib,2023-04-20,,,empty,"4/20: pulled flag" +2023,6th_bridge,630,glib,2023-04-27,,,,"4/20: pulled flag" +2023,6th_bridge,630,glib,2023-05-03,,,,"4/20: pulled flag" +2023,6th_bridge,632,glib,2023-02-22,,,,"4/15: broken egg in nest 4/20: pulled flag" +2023,6th_bridge,632,glib,2023-03-01,,,,"4/15: broken egg in nest 4/20: pulled flag" +2023,6th_bridge,632,glib,2023-03-08,,,,"4/15: broken egg in nest 4/20: pulled flag" +2023,6th_bridge,632,glib,2023-03-14,,,,"4/15: broken egg in nest 4/20: pulled flag" +2023,6th_bridge,632,glib,2023-03-21,,,,"4/15: broken egg in nest 4/20: pulled flag" +2023,6th_bridge,632,glib,2023-03-28,,,,"4/15: broken egg in nest 4/20: pulled flag" +2023,6th_bridge,632,glib,2023-04-04,1,,incubating,"4/15: broken egg in nest 4/20: pulled flag" +2023,6th_bridge,632,glib,2023-04-15,,,empty,"4/15: broken egg in nest 4/20: pulled flag" +2023,6th_bridge,632,glib,2023-04-20,,,pulled,"4/15: broken egg in nest 4/20: pulled flag" +2023,6th_bridge,632,glib,2023-04-27,,,,"4/15: broken egg in nest 4/20: pulled flag" +2023,6th_bridge,632,glib,2023-05-03,,,,"4/15: broken egg in nest 4/20: pulled flag" +2023,6th_bridge,634,glib,2023-02-22,,,,"4/20: pulled flag" +2023,6th_bridge,634,glib,2023-03-01,,,,"4/20: pulled flag" +2023,6th_bridge,634,glib,2023-03-08,,,,"4/20: pulled flag" +2023,6th_bridge,634,glib,2023-03-14,,,,"4/20: pulled flag" +2023,6th_bridge,634,glib,2023-03-21,,,,"4/20: pulled flag" +2023,6th_bridge,634,glib,2023-03-28,,,,"4/20: pulled flag" +2023,6th_bridge,634,glib,2023-04-04,1,,incubating,"4/20: pulled flag" +2023,6th_bridge,634,glib,2023-04-15,,,empty,"4/20: pulled flag" +2023,6th_bridge,634,glib,2023-04-20,,,pulled,"4/20: pulled flag" +2023,6th_bridge,634,glib,2023-04-27,,,,"4/20: pulled flag" +2023,6th_bridge,634,glib,2023-05-03,,,,"4/20: pulled flag" +2023,6th_bridge,636,glib,2023-02-22,,,,"4/27: Flag pulled" +2023,6th_bridge,636,glib,2023-03-01,,,,"4/27: Flag pulled" +2023,6th_bridge,636,glib,2023-03-08,,,,"4/27: Flag pulled" +2023,6th_bridge,636,glib,2023-03-14,,,,"4/27: Flag pulled" +2023,6th_bridge,636,glib,2023-03-21,,,,"4/27: Flag pulled" +2023,6th_bridge,636,glib,2023-03-28,,,,"4/27: Flag pulled" +2023,6th_bridge,636,glib,2023-04-04,3,,incubating,"4/27: Flag pulled" +2023,6th_bridge,636,glib,2023-04-15,1,2,hatching,"4/27: Flag pulled" +2023,6th_bridge,636,glib,2023-04-20,,,missed,"4/27: Flag pulled" +2023,6th_bridge,636,glib,2023-04-27,,,empty,"4/27: Flag pulled" +2023,6th_bridge,636,glib,2023-05-03,,,,"4/27: Flag pulled" +2023,6th_bridge,638,glib,2023-02-22,,,,"4/20: pulled flag" +2023,6th_bridge,638,glib,2023-03-01,,,,"4/20: pulled flag" +2023,6th_bridge,638,glib,2023-03-08,,,,"4/20: pulled flag" +2023,6th_bridge,638,glib,2023-03-14,,,,"4/20: pulled flag" +2023,6th_bridge,638,glib,2023-03-21,,,,"4/20: pulled flag" +2023,6th_bridge,638,glib,2023-03-28,,,,"4/20: pulled flag" +2023,6th_bridge,638,glib,2023-04-04,1,,incubating,"4/20: pulled flag" +2023,6th_bridge,638,glib,2023-04-15,3,,incubating,"4/20: pulled flag" +2023,6th_bridge,638,glib,2023-04-20,,,empty,"4/20: pulled flag" +2023,6th_bridge,638,glib,2023-04-27,,,,"4/20: pulled flag" +2023,6th_bridge,638,glib,2023-05-03,,,,"4/20: pulled flag" +2023,6th_bridge,640,glib,2023-02-22,,,,"4/20: pulled flag" +2023,6th_bridge,640,glib,2023-03-01,,,,"4/20: pulled flag" +2023,6th_bridge,640,glib,2023-03-08,,,,"4/20: pulled flag" +2023,6th_bridge,640,glib,2023-03-14,,,,"4/20: pulled flag" +2023,6th_bridge,640,glib,2023-03-21,,,,"4/20: pulled flag" +2023,6th_bridge,640,glib,2023-03-28,,,,"4/20: pulled flag" +2023,6th_bridge,640,glib,2023-04-04,1,,incubating,"4/20: pulled flag" +2023,6th_bridge,640,glib,2023-04-15,,,empty,"4/20: pulled flag" +2023,6th_bridge,640,glib,2023-04-20,,,pulled,"4/20: pulled flag" +2023,6th_bridge,640,glib,2023-04-27,,,,"4/20: pulled flag" +2023,6th_bridge,640,glib,2023-05-03,,,,"4/20: pulled flag" +2023,6th_bridge,642,glib,2023-02-22,,,,"4/20: pulled flag" +2023,6th_bridge,642,glib,2023-03-01,,,,"4/20: pulled flag" +2023,6th_bridge,642,glib,2023-03-08,,,,"4/20: pulled flag" +2023,6th_bridge,642,glib,2023-03-14,,,,"4/20: pulled flag" +2023,6th_bridge,642,glib,2023-03-21,,,,"4/20: pulled flag" +2023,6th_bridge,642,glib,2023-03-28,,,,"4/20: pulled flag" +2023,6th_bridge,642,glib,2023-04-04,3,,incubating,"4/20: pulled flag" +2023,6th_bridge,642,glib,2023-04-15,3,,incubating,"4/20: pulled flag" +2023,6th_bridge,642,glib,2023-04-20,,,empty,"4/20: pulled flag" +2023,6th_bridge,642,glib,2023-04-27,,,,"4/20: pulled flag" +2023,6th_bridge,642,glib,2023-05-03,,,,"4/20: pulled flag" +2023,6th_bridge,644,glib,2023-02-22,,,,"4/15: next to 93 4/20: pulled flag" +2023,6th_bridge,644,glib,2023-03-01,,,,"4/15: next to 93 4/20: pulled flag" +2023,6th_bridge,644,glib,2023-03-08,,,,"4/15: next to 93 4/20: pulled flag" +2023,6th_bridge,644,glib,2023-03-14,,,,"4/15: next to 93 4/20: pulled flag" +2023,6th_bridge,644,glib,2023-03-21,,,,"4/15: next to 93 4/20: pulled flag" +2023,6th_bridge,644,glib,2023-03-28,,,,"4/15: next to 93 4/20: pulled flag" +2023,6th_bridge,644,glib,2023-04-04,,,,"4/15: next to 93 4/20: pulled flag" +2023,6th_bridge,644,glib,2023-04-15,3,,incubating,"4/15: next to 93 4/20: pulled flag" +2023,6th_bridge,644,glib,2023-04-20,,,empty,"4/15: next to 93 4/20: pulled flag" +2023,6th_bridge,644,glib,2023-04-27,,,,"4/15: next to 93 4/20: pulled flag" +2023,6th_bridge,644,glib,2023-05-03,,,,"4/15: next to 93 4/20: pulled flag" +2023,6th_bridge,646,glib,2023-02-22,,,,"4/20: pulled flag" +2023,6th_bridge,646,glib,2023-03-01,,,,"4/20: pulled flag" +2023,6th_bridge,646,glib,2023-03-08,,,,"4/20: pulled flag" +2023,6th_bridge,646,glib,2023-03-14,,,,"4/20: pulled flag" +2023,6th_bridge,646,glib,2023-03-21,,,,"4/20: pulled flag" +2023,6th_bridge,646,glib,2023-03-28,,,,"4/20: pulled flag" +2023,6th_bridge,646,glib,2023-04-04,,,,"4/20: pulled flag" +2023,6th_bridge,646,glib,2023-04-15,3,,incubating,"4/20: pulled flag" +2023,6th_bridge,646,glib,2023-04-20,,,empty,"4/20: pulled flag" +2023,6th_bridge,646,glib,2023-04-27,,,,"4/20: pulled flag" +2023,6th_bridge,646,glib,2023-05-03,,,,"4/20: pulled flag" +2023,6th_bridge,311,whib,2023-02-22,,,, +2023,6th_bridge,311,whib,2023-03-01,3,,incubating, +2023,6th_bridge,311,whib,2023-03-08,3,,incubating, +2023,6th_bridge,311,whib,2023-03-14,3,,incubating, +2023,6th_bridge,311,whib,2023-03-21,,3,nestling, +2023,6th_bridge,311,whib,2023-03-28,,2,nestling, +2023,6th_bridge,311,whib,2023-04-04,,,empty, +2023,6th_bridge,311,whib,2023-04-15,,,, +2023,6th_bridge,311,whib,2023-04-20,,,pulled, +2023,6th_bridge,311,whib,2023-04-27,,,, +2023,6th_bridge,311,whib,2023-05-03,,,, +2023,6th_bridge,313,whib,2023-02-22,,,,"4/4: one chick in tree" +2023,6th_bridge,313,whib,2023-03-01,2,,incubating,"4/4: one chick in tree" +2023,6th_bridge,313,whib,2023-03-08,2,,incubating,"4/4: one chick in tree" +2023,6th_bridge,313,whib,2023-03-14,2,,incubating,"4/4: one chick in tree" +2023,6th_bridge,313,whib,2023-03-21,,2,nestling,"4/4: one chick in tree" +2023,6th_bridge,313,whib,2023-03-28,,2,nestling,"4/4: one chick in tree" +2023,6th_bridge,313,whib,2023-04-04,,1,nestling,"4/4: one chick in tree" +2023,6th_bridge,313,whib,2023-04-15,,,empty,"4/4: one chick in tree" +2023,6th_bridge,313,whib,2023-04-20,,,pulled,"4/4: one chick in tree" +2023,6th_bridge,313,whib,2023-04-27,,,,"4/4: one chick in tree" +2023,6th_bridge,313,whib,2023-05-03,,,,"4/4: one chick in tree" +2023,6th_bridge,244,whib,2023-02-22,,,,"3/21: GLIB takeover 4/20: flag pulled" +2023,6th_bridge,244,whib,2023-03-01,3,,incubating,"3/21: GLIB takeover 4/20: flag pulled" +2023,6th_bridge,244,whib,2023-03-08,,,empty,"3/21: GLIB takeover 4/20: flag pulled" +2023,6th_bridge,244,whib,2023-03-14,,,empty,"3/21: GLIB takeover 4/20: flag pulled" +2023,6th_bridge,244,whib,2023-03-21,,,,"3/21: GLIB takeover 4/20: flag pulled" +2023,6th_bridge,244,whib,2023-03-28,,,,"3/21: GLIB takeover 4/20: flag pulled" +2023,6th_bridge,244,whib,2023-04-04,,,,"3/21: GLIB takeover 4/20: flag pulled" +2023,6th_bridge,244,whib,2023-04-15,,,,"3/21: GLIB takeover 4/20: flag pulled" +2023,6th_bridge,244,whib,2023-04-20,,,,"3/21: GLIB takeover 4/20: flag pulled" +2023,6th_bridge,244,whib,2023-04-27,,,,"3/21: GLIB takeover 4/20: flag pulled" +2023,6th_bridge,244,whib,2023-05-03,,,,"3/21: GLIB takeover 4/20: flag pulled" +2023,6th_bridge,*244,glib,2023-02-22,,,, +2023,6th_bridge,*244,glib,2023-03-01,,,, +2023,6th_bridge,*244,glib,2023-03-08,,,, +2023,6th_bridge,*244,glib,2023-03-14,,,, +2023,6th_bridge,*244,glib,2023-03-21,1,,incubating, +2023,6th_bridge,*244,glib,2023-03-28,3,,incubating, +2023,6th_bridge,*244,glib,2023-04-04,3,,incubating, +2023,6th_bridge,*244,glib,2023-04-15,,,missed, +2023,6th_bridge,*244,glib,2023-04-20,,,empty, +2023,6th_bridge,*244,glib,2023-04-27,,,pulled, +2023,6th_bridge,*244,glib,2023-05-03,,,, +2023,6th_bridge,246,whib,2023-02-22,,,,"4/4: certain 2 chicks 4/15: 1C+, 3 total branchlings between 246 and 248 4/20: flag pulled" +2023,6th_bridge,246,whib,2023-03-01,2,,incubating,"4/4: certain 2 chicks 4/15: 1C+, 3 total branchlings between 246 and 248 4/20: flag pulled" +2023,6th_bridge,246,whib,2023-03-08,2,,incubating,"4/4: certain 2 chicks 4/15: 1C+, 3 total branchlings between 246 and 248 4/20: flag pulled" +2023,6th_bridge,246,whib,2023-03-14,2,,incubating,"4/4: certain 2 chicks 4/15: 1C+, 3 total branchlings between 246 and 248 4/20: flag pulled" +2023,6th_bridge,246,whib,2023-03-21,,2,nestling,"4/4: certain 2 chicks 4/15: 1C+, 3 total branchlings between 246 and 248 4/20: flag pulled" +2023,6th_bridge,246,whib,2023-03-28,,2,nestling,"4/4: certain 2 chicks 4/15: 1C+, 3 total branchlings between 246 and 248 4/20: flag pulled" +2023,6th_bridge,246,whib,2023-04-04,,2,nestling,"4/4: certain 2 chicks 4/15: 1C+, 3 total branchlings between 246 and 248 4/20: flag pulled" +2023,6th_bridge,246,whib,2023-04-15,,1,nestling,"4/4: certain 2 chicks 4/15: 1C+, 3 total branchlings between 246 and 248 4/20: flag pulled" +2023,6th_bridge,246,whib,2023-04-20,,,empty,"4/4: certain 2 chicks 4/15: 1C+, 3 total branchlings between 246 and 248 4/20: flag pulled" +2023,6th_bridge,246,whib,2023-04-27,,,pulled,"4/4: certain 2 chicks 4/15: 1C+, 3 total branchlings between 246 and 248 4/20: flag pulled" +2023,6th_bridge,246,whib,2023-05-03,,,,"4/4: certain 2 chicks 4/15: 1C+, 3 total branchlings between 246 and 248 4/20: flag pulled" +2023,6th_bridge,248,whib,2023-02-22,,,,"4/15: 3 total branchlings between 246 and 248 4/20: flag pulled" +2023,6th_bridge,248,whib,2023-03-01,3,,incubating,"4/15: 3 total branchlings between 246 and 248 4/20: flag pulled" +2023,6th_bridge,248,whib,2023-03-08,3,,incubating,"4/15: 3 total branchlings between 246 and 248 4/20: flag pulled" +2023,6th_bridge,248,whib,2023-03-14,3,,incubating,"4/15: 3 total branchlings between 246 and 248 4/20: flag pulled" +2023,6th_bridge,248,whib,2023-03-21,2,1,chick_dry,"4/15: 3 total branchlings between 246 and 248 4/20: flag pulled" +2023,6th_bridge,248,whib,2023-03-28,2,1,hatching,"4/15: 3 total branchlings between 246 and 248 4/20: flag pulled" +2023,6th_bridge,248,whib,2023-04-04,,1,nestling,"4/15: 3 total branchlings between 246 and 248 4/20: flag pulled" +2023,6th_bridge,248,whib,2023-04-15,,1,nestling,"4/15: 3 total branchlings between 246 and 248 4/20: flag pulled" +2023,6th_bridge,248,whib,2023-04-20,,,empty,"4/15: 3 total branchlings between 246 and 248 4/20: flag pulled" +2023,6th_bridge,248,whib,2023-04-27,,,pulled,"4/15: 3 total branchlings between 246 and 248 4/20: flag pulled" +2023,6th_bridge,248,whib,2023-05-03,,,,"4/15: 3 total branchlings between 246 and 248 4/20: flag pulled" +2023,6th_bridge,315,bcnh,2023-02-22,,,,"3/21: Egg pipping, chick dry 4/4: flag pulled" +2023,6th_bridge,315,bcnh,2023-03-01,2,,incubating,"3/21: Egg pipping, chick dry 4/4: flag pulled" +2023,6th_bridge,315,bcnh,2023-03-08,3,,incubating,"3/21: Egg pipping, chick dry 4/4: flag pulled" +2023,6th_bridge,315,bcnh,2023-03-14,3,,incubating,"3/21: Egg pipping, chick dry 4/4: flag pulled" +2023,6th_bridge,315,bcnh,2023-03-21,2,1,chick_dry,"3/21: Egg pipping, chick dry 4/4: flag pulled" +2023,6th_bridge,315,bcnh,2023-03-28,,2,nestling,"3/21: Egg pipping, chick dry 4/4: flag pulled" +2023,6th_bridge,315,bcnh,2023-04-04,,,empty,"3/21: Egg pipping, chick dry 4/4: flag pulled" +2023,6th_bridge,315,bcnh,2023-04-15,,,,"3/21: Egg pipping, chick dry 4/4: flag pulled" +2023,6th_bridge,315,bcnh,2023-04-20,,,,"3/21: Egg pipping, chick dry 4/4: flag pulled" +2023,6th_bridge,315,bcnh,2023-04-27,,,,"3/21: Egg pipping, chick dry 4/4: flag pulled" +2023,6th_bridge,315,bcnh,2023-05-03,,,,"3/21: Egg pipping, chick dry 4/4: flag pulled" +2023,6th_bridge,317,whib,2023-02-22,,,,"3/28: nest gone 4/4: pulled flag" +2023,6th_bridge,317,whib,2023-03-01,2,,incubating,"3/28: nest gone 4/4: pulled flag" +2023,6th_bridge,317,whib,2023-03-08,2,,incubating,"3/28: nest gone 4/4: pulled flag" +2023,6th_bridge,317,whib,2023-03-14,2,,incubating,"3/28: nest gone 4/4: pulled flag" +2023,6th_bridge,317,whib,2023-03-21,,1,nestling,"3/28: nest gone 4/4: pulled flag" +2023,6th_bridge,317,whib,2023-03-28,,,empty,"3/28: nest gone 4/4: pulled flag" +2023,6th_bridge,317,whib,2023-04-04,,,pulled,"3/28: nest gone 4/4: pulled flag" +2023,6th_bridge,317,whib,2023-04-15,,,,"3/28: nest gone 4/4: pulled flag" +2023,6th_bridge,317,whib,2023-04-20,,,,"3/28: nest gone 4/4: pulled flag" +2023,6th_bridge,317,whib,2023-04-27,,,,"3/28: nest gone 4/4: pulled flag" +2023,6th_bridge,317,whib,2023-05-03,,,,"3/28: nest gone 4/4: pulled flag" +2023,6th_bridge,319,whib,2023-02-22,,,,"3/28: nest gone 4/4: pulled flag" +2023,6th_bridge,319,whib,2023-03-01,2,,incubating,"3/28: nest gone 4/4: pulled flag" +2023,6th_bridge,319,whib,2023-03-08,2,,incubating,"3/28: nest gone 4/4: pulled flag" +2023,6th_bridge,319,whib,2023-03-14,2,,incubating,"3/28: nest gone 4/4: pulled flag" +2023,6th_bridge,319,whib,2023-03-21,2,,incubating,"3/28: nest gone 4/4: pulled flag" +2023,6th_bridge,319,whib,2023-03-28,,,empty,"3/28: nest gone 4/4: pulled flag" +2023,6th_bridge,319,whib,2023-04-04,,,pulled,"3/28: nest gone 4/4: pulled flag" +2023,6th_bridge,319,whib,2023-04-15,,,,"3/28: nest gone 4/4: pulled flag" +2023,6th_bridge,319,whib,2023-04-20,,,,"3/28: nest gone 4/4: pulled flag" +2023,6th_bridge,319,whib,2023-04-27,,,,"3/28: nest gone 4/4: pulled flag" +2023,6th_bridge,319,whib,2023-05-03,,,,"3/28: nest gone 4/4: pulled flag" +2023,6th_bridge,321,whib,2023-02-22,,,, +2023,6th_bridge,321,whib,2023-03-01,3,,incubating, +2023,6th_bridge,321,whib,2023-03-08,3,,incubating, +2023,6th_bridge,321,whib,2023-03-14,3,,incubating, +2023,6th_bridge,321,whib,2023-03-21,,,empty, +2023,6th_bridge,321,whib,2023-03-28,,,empty, +2023,6th_bridge,321,whib,2023-04-04,,,missed, +2023,6th_bridge,321,whib,2023-04-15,,,, +2023,6th_bridge,321,whib,2023-04-20,,,, +2023,6th_bridge,321,whib,2023-04-27,,,, +2023,6th_bridge,321,whib,2023-05-03,,,, +2023,6th_bridge,*321,glib,2023-02-22,,,,"4/15: GLIB took over empty WHIB nest 4/20: flag pulled, eggshell on ground" +2023,6th_bridge,*321,glib,2023-03-01,,,,"4/15: GLIB took over empty WHIB nest 4/20: flag pulled, eggshell on ground" +2023,6th_bridge,*321,glib,2023-03-08,,,,"4/15: GLIB took over empty WHIB nest 4/20: flag pulled, eggshell on ground" +2023,6th_bridge,*321,glib,2023-03-14,,,,"4/15: GLIB took over empty WHIB nest 4/20: flag pulled, eggshell on ground" +2023,6th_bridge,*321,glib,2023-03-21,,,,"4/15: GLIB took over empty WHIB nest 4/20: flag pulled, eggshell on ground" +2023,6th_bridge,*321,glib,2023-03-28,,,,"4/15: GLIB took over empty WHIB nest 4/20: flag pulled, eggshell on ground" +2023,6th_bridge,*321,glib,2023-04-04,,,,"4/15: GLIB took over empty WHIB nest 4/20: flag pulled, eggshell on ground" +2023,6th_bridge,*321,glib,2023-04-15,3,,incubating,"4/15: GLIB took over empty WHIB nest 4/20: flag pulled, eggshell on ground" +2023,6th_bridge,*321,glib,2023-04-20,,,empty,"4/15: GLIB took over empty WHIB nest 4/20: flag pulled, eggshell on ground" +2023,6th_bridge,*321,glib,2023-04-27,,,,"4/15: GLIB took over empty WHIB nest 4/20: flag pulled, eggshell on ground" +2023,6th_bridge,*321,glib,2023-05-03,,,,"4/15: GLIB took over empty WHIB nest 4/20: flag pulled, eggshell on ground" +2023,6th_bridge,323,whib,2023-02-22,,,,"4/4: 3 chicks around 323, 325, 327 nest area" +2023,6th_bridge,323,whib,2023-03-01,2,,incubating,"4/4: 3 chicks around 323, 325, 327 nest area" +2023,6th_bridge,323,whib,2023-03-08,2,,incubating,"4/4: 3 chicks around 323, 325, 327 nest area" +2023,6th_bridge,323,whib,2023-03-14,2,,incubating,"4/4: 3 chicks around 323, 325, 327 nest area" +2023,6th_bridge,323,whib,2023-03-21,,2,nestling,"4/4: 3 chicks around 323, 325, 327 nest area" +2023,6th_bridge,323,whib,2023-03-28,,2,nestling,"4/4: 3 chicks around 323, 325, 327 nest area" +2023,6th_bridge,323,whib,2023-04-04,,1,nestling,"4/4: 3 chicks around 323, 325, 327 nest area" +2023,6th_bridge,323,whib,2023-04-15,,,empty,"4/4: 3 chicks around 323, 325, 327 nest area" +2023,6th_bridge,323,whib,2023-04-20,,,pulled,"4/4: 3 chicks around 323, 325, 327 nest area" +2023,6th_bridge,323,whib,2023-04-27,,,,"4/4: 3 chicks around 323, 325, 327 nest area" +2023,6th_bridge,323,whib,2023-05-03,,,,"4/4: 3 chicks around 323, 325, 327 nest area" +2023,6th_bridge,325,whib,2023-02-22,,,,"3/8: nest gone; 4/4: 3 chicks around 323, 325, 327 nest area" +2023,6th_bridge,325,whib,2023-03-01,2,,incubating,"3/8: nest gone; 4/4: 3 chicks around 323, 325, 327 nest area" +2023,6th_bridge,325,whib,2023-03-08,,,empty,"3/8: nest gone; 4/4: 3 chicks around 323, 325, 327 nest area" +2023,6th_bridge,325,whib,2023-03-14,,,,"3/8: nest gone; 4/4: 3 chicks around 323, 325, 327 nest area" +2023,6th_bridge,325,whib,2023-03-21,,,,"3/8: nest gone; 4/4: 3 chicks around 323, 325, 327 nest area" +2023,6th_bridge,325,whib,2023-03-28,,,,"3/8: nest gone; 4/4: 3 chicks around 323, 325, 327 nest area" +2023,6th_bridge,325,whib,2023-04-04,,,,"3/8: nest gone; 4/4: 3 chicks around 323, 325, 327 nest area" +2023,6th_bridge,325,whib,2023-04-15,,,,"3/8: nest gone; 4/4: 3 chicks around 323, 325, 327 nest area" +2023,6th_bridge,325,whib,2023-04-20,,,pulled,"3/8: nest gone; 4/4: 3 chicks around 323, 325, 327 nest area" +2023,6th_bridge,325,whib,2023-04-27,,,,"3/8: nest gone; 4/4: 3 chicks around 323, 325, 327 nest area" +2023,6th_bridge,325,whib,2023-05-03,,,,"3/8: nest gone; 4/4: 3 chicks around 323, 325, 327 nest area" +2023,6th_bridge,327,whib,2023-02-22,,,,"4/4: 3 chicks around 323, 325, 327 nest area" +2023,6th_bridge,327,whib,2023-03-01,2,,incubating,"4/4: 3 chicks around 323, 325, 327 nest area" +2023,6th_bridge,327,whib,2023-03-08,2,,incubating,"4/4: 3 chicks around 323, 325, 327 nest area" +2023,6th_bridge,327,whib,2023-03-14,2,,incubating,"4/4: 3 chicks around 323, 325, 327 nest area" +2023,6th_bridge,327,whib,2023-03-21,1,1,hatching,"4/4: 3 chicks around 323, 325, 327 nest area" +2023,6th_bridge,327,whib,2023-03-28,1,1,hatching,"4/4: 3 chicks around 323, 325, 327 nest area" +2023,6th_bridge,327,whib,2023-04-04,,1,nestling,"4/4: 3 chicks around 323, 325, 327 nest area" +2023,6th_bridge,327,whib,2023-04-15,,,empty,"4/4: 3 chicks around 323, 325, 327 nest area" +2023,6th_bridge,327,whib,2023-04-20,,,pulled,"4/4: 3 chicks around 323, 325, 327 nest area" +2023,6th_bridge,327,whib,2023-04-27,,,,"4/4: 3 chicks around 323, 325, 327 nest area" +2023,6th_bridge,327,whib,2023-05-03,,,,"4/4: 3 chicks around 323, 325, 327 nest area" +2023,6th_bridge,256,sneg,2023-02-22,,,,"3/8: smhe nest 3/21: angry SNEG nearby 4/15: 2C+, branchlings 4/20: flag pulled" +2023,6th_bridge,256,sneg,2023-03-01,4,,incubating,"3/8: smhe nest 3/21: angry SNEG nearby 4/15: 2C+, branchlings 4/20: flag pulled" +2023,6th_bridge,256,sneg,2023-03-08,4,,incubating,"3/8: smhe nest 3/21: angry SNEG nearby 4/15: 2C+, branchlings 4/20: flag pulled" +2023,6th_bridge,256,sneg,2023-03-14,4,,incubating,"3/8: smhe nest 3/21: angry SNEG nearby 4/15: 2C+, branchlings 4/20: flag pulled" +2023,6th_bridge,256,sneg,2023-03-21,1,3,hatching,"3/8: smhe nest 3/21: angry SNEG nearby 4/15: 2C+, branchlings 4/20: flag pulled" +2023,6th_bridge,256,sneg,2023-03-28,,4,nestling,"3/8: smhe nest 3/21: angry SNEG nearby 4/15: 2C+, branchlings 4/20: flag pulled" +2023,6th_bridge,256,sneg,2023-04-04,,3,nestling,"3/8: smhe nest 3/21: angry SNEG nearby 4/15: 2C+, branchlings 4/20: flag pulled" +2023,6th_bridge,256,sneg,2023-04-15,,2,nestling,"3/8: smhe nest 3/21: angry SNEG nearby 4/15: 2C+, branchlings 4/20: flag pulled" +2023,6th_bridge,256,sneg,2023-04-20,,,empty,"3/8: smhe nest 3/21: angry SNEG nearby 4/15: 2C+, branchlings 4/20: flag pulled" +2023,6th_bridge,256,sneg,2023-04-27,,,,"3/8: smhe nest 3/21: angry SNEG nearby 4/15: 2C+, branchlings 4/20: flag pulled" +2023,6th_bridge,256,sneg,2023-05-03,,,,"3/8: smhe nest 3/21: angry SNEG nearby 4/15: 2C+, branchlings 4/20: flag pulled" +2023,6th_bridge,329,whib,2023-02-22,,,,"3/21: eggshells on ground" +2023,6th_bridge,329,whib,2023-03-01,3,,incubating,"3/21: eggshells on ground" +2023,6th_bridge,329,whib,2023-03-08,3,,incubating,"3/21: eggshells on ground" +2023,6th_bridge,329,whib,2023-03-14,3,,incubating,"3/21: eggshells on ground" +2023,6th_bridge,329,whib,2023-03-21,,,empty,"3/21: eggshells on ground" +2023,6th_bridge,329,whib,2023-03-28,,,empty,"3/21: eggshells on ground" +2023,6th_bridge,329,whib,2023-04-04,,,,"3/21: eggshells on ground" +2023,6th_bridge,329,whib,2023-04-15,,,,"3/21: eggshells on ground" +2023,6th_bridge,329,whib,2023-04-20,,,,"3/21: eggshells on ground" +2023,6th_bridge,329,whib,2023-04-27,,,,"3/21: eggshells on ground" +2023,6th_bridge,329,whib,2023-05-03,,,,"3/21: eggshells on ground" +2023,6th_bridge,*329,glib,2023-02-22,,,,"4/4: GLIB re-lay 4/20: flag pulled" +2023,6th_bridge,*329,glib,2023-03-01,,,,"4/4: GLIB re-lay 4/20: flag pulled" +2023,6th_bridge,*329,glib,2023-03-08,,,,"4/4: GLIB re-lay 4/20: flag pulled" +2023,6th_bridge,*329,glib,2023-03-14,,,,"4/4: GLIB re-lay 4/20: flag pulled" +2023,6th_bridge,*329,glib,2023-03-21,,,,"4/4: GLIB re-lay 4/20: flag pulled" +2023,6th_bridge,*329,glib,2023-03-28,,,,"4/4: GLIB re-lay 4/20: flag pulled" +2023,6th_bridge,*329,glib,2023-04-04,2,,incubating,"4/4: GLIB re-lay 4/20: flag pulled" +2023,6th_bridge,*329,glib,2023-04-15,2,,incubating,"4/4: GLIB re-lay 4/20: flag pulled" +2023,6th_bridge,*329,glib,2023-04-20,,,empty,"4/4: GLIB re-lay 4/20: flag pulled" +2023,6th_bridge,*329,glib,2023-04-27,,,,"4/4: GLIB re-lay 4/20: flag pulled" +2023,6th_bridge,*329,glib,2023-05-03,,,,"4/4: GLIB re-lay 4/20: flag pulled" +2023,6th_bridge,258,whib,2023-02-22,,,,"4/20: flag pulled" +2023,6th_bridge,258,whib,2023-03-01,2,,incubating,"4/20: flag pulled" +2023,6th_bridge,258,whib,2023-03-08,2,,incubating,"4/20: flag pulled" +2023,6th_bridge,258,whib,2023-03-14,2,,incubating,"4/20: flag pulled" +2023,6th_bridge,258,whib,2023-03-21,2,,incubating,"4/20: flag pulled" +2023,6th_bridge,258,whib,2023-03-28,2,,incubating,"4/20: flag pulled" +2023,6th_bridge,258,whib,2023-04-04,2,,incubating,"4/20: flag pulled" +2023,6th_bridge,258,whib,2023-04-15,1,,incubating,"4/20: flag pulled" +2023,6th_bridge,258,whib,2023-04-20,,,empty,"4/20: flag pulled" +2023,6th_bridge,258,whib,2023-04-27,,,pulled,"4/20: flag pulled" +2023,6th_bridge,258,whib,2023-05-03,,,,"4/20: flag pulled" +2023,6th_bridge,250,whib,2023-02-22,,,,"4/20: nest collapsed, flag pulled" +2023,6th_bridge,250,whib,2023-03-01,3,,incubating,"4/20: nest collapsed, flag pulled" +2023,6th_bridge,250,whib,2023-03-08,3,,incubating,"4/20: nest collapsed, flag pulled" +2023,6th_bridge,250,whib,2023-03-14,3,,incubating,"4/20: nest collapsed, flag pulled" +2023,6th_bridge,250,whib,2023-03-21,,2,chick_dry,"4/20: nest collapsed, flag pulled" +2023,6th_bridge,250,whib,2023-03-28,,,empty,"4/20: nest collapsed, flag pulled" +2023,6th_bridge,250,whib,2023-04-04,,,missed,"4/20: nest collapsed, flag pulled" +2023,6th_bridge,250,whib,2023-04-15,,,missed,"4/20: nest collapsed, flag pulled" +2023,6th_bridge,250,whib,2023-04-20,,,pulled,"4/20: nest collapsed, flag pulled" +2023,6th_bridge,250,whib,2023-04-27,,,,"4/20: nest collapsed, flag pulled" +2023,6th_bridge,250,whib,2023-05-03,,,,"4/20: nest collapsed, flag pulled" +2023,6th_bridge,252,smhe,2023-02-22,,,,"3/8: very small eggs 4/20: flag pulled" +2023,6th_bridge,252,smhe,2023-03-01,2,,incubating,"3/8: very small eggs 4/20: flag pulled" +2023,6th_bridge,252,smhe,2023-03-08,3,,incubating,"3/8: very small eggs 4/20: flag pulled" +2023,6th_bridge,252,smhe,2023-03-14,3,,incubating,"3/8: very small eggs 4/20: flag pulled" +2023,6th_bridge,252,smhe,2023-03-21,3,,incubating,"3/8: very small eggs 4/20: flag pulled" +2023,6th_bridge,252,smhe,2023-03-28,,,empty,"3/8: very small eggs 4/20: flag pulled" +2023,6th_bridge,252,smhe,2023-04-04,,,empty,"3/8: very small eggs 4/20: flag pulled" +2023,6th_bridge,252,smhe,2023-04-15,,,missed,"3/8: very small eggs 4/20: flag pulled" +2023,6th_bridge,252,smhe,2023-04-20,,,pulled,"3/8: very small eggs 4/20: flag pulled" +2023,6th_bridge,252,smhe,2023-04-27,,,,"3/8: very small eggs 4/20: flag pulled" +2023,6th_bridge,252,smhe,2023-05-03,,,,"3/8: very small eggs 4/20: flag pulled" +2023,6th_bridge,260,whib,2023-02-22,,,,"3/14: look like nest on top of nest" +2023,6th_bridge,260,whib,2023-03-01,2,,incubating,"3/14: look like nest on top of nest" +2023,6th_bridge,260,whib,2023-03-08,3,,incubating,"3/14: look like nest on top of nest" +2023,6th_bridge,260,whib,2023-03-14,3,,incubating,"3/14: look like nest on top of nest" +2023,6th_bridge,260,whib,2023-03-21,1,2,hatching,"3/14: look like nest on top of nest" +2023,6th_bridge,260,whib,2023-03-28,,2,nestling,"3/14: look like nest on top of nest" +2023,6th_bridge,260,whib,2023-04-04,,,missed,"3/14: look like nest on top of nest" +2023,6th_bridge,260,whib,2023-04-15,,,empty,"3/14: look like nest on top of nest" +2023,6th_bridge,260,whib,2023-04-20,,,pulled,"3/14: look like nest on top of nest" +2023,6th_bridge,260,whib,2023-04-27,,,,"3/14: look like nest on top of nest" +2023,6th_bridge,260,whib,2023-05-03,,,,"3/14: look like nest on top of nest" +2023,6th_bridge,254,smwh,2023-02-22,,,,"3/14: small eggs, SMHE?; 3/21: final egg pipping 4/15: chicks healthy 4/20: freshly dead chick under nest" +2023,6th_bridge,254,smwh,2023-03-01,3,,incubating,"3/14: small eggs, SMHE?; 3/21: final egg pipping 4/15: chicks healthy 4/20: freshly dead chick under nest" +2023,6th_bridge,254,smwh,2023-03-08,3,,incubating,"3/14: small eggs, SMHE?; 3/21: final egg pipping 4/15: chicks healthy 4/20: freshly dead chick under nest" +2023,6th_bridge,254,smwh,2023-03-14,3,,incubating,"3/14: small eggs, SMHE?; 3/21: final egg pipping 4/15: chicks healthy 4/20: freshly dead chick under nest" +2023,6th_bridge,254,smwh,2023-03-21,1,2,pipping,"3/14: small eggs, SMHE?; 3/21: final egg pipping 4/15: chicks healthy 4/20: freshly dead chick under nest" +2023,6th_bridge,254,smwh,2023-03-28,,3,nestling,"3/14: small eggs, SMHE?; 3/21: final egg pipping 4/15: chicks healthy 4/20: freshly dead chick under nest" +2023,6th_bridge,254,smwh,2023-04-04,,2,nestling,"3/14: small eggs, SMHE?; 3/21: final egg pipping 4/15: chicks healthy 4/20: freshly dead chick under nest" +2023,6th_bridge,254,smwh,2023-04-15,,2,nestling,"3/14: small eggs, SMHE?; 3/21: final egg pipping 4/15: chicks healthy 4/20: freshly dead chick under nest" +2023,6th_bridge,254,smwh,2023-04-20,,,empty,"3/14: small eggs, SMHE?; 3/21: final egg pipping 4/15: chicks healthy 4/20: freshly dead chick under nest" +2023,6th_bridge,254,smwh,2023-04-27,,,pulled,"3/14: small eggs, SMHE?; 3/21: final egg pipping 4/15: chicks healthy 4/20: freshly dead chick under nest" +2023,6th_bridge,254,smwh,2023-05-03,,,,"3/14: small eggs, SMHE?; 3/21: final egg pipping 4/15: chicks healthy 4/20: freshly dead chick under nest" +2023,6th_bridge,305,greg,2023-02-22,,,,"3/14: small eggs, GREG taken over by SMHE?" +2023,6th_bridge,305,greg,2023-03-01,2,,incubating,"3/14: small eggs, GREG taken over by SMHE?" +2023,6th_bridge,305,greg,2023-03-08,1,,incubating,"3/14: small eggs, GREG taken over by SMHE?" +2023,6th_bridge,305,greg,2023-03-14,,,,"3/14: small eggs, GREG taken over by SMHE?" +2023,6th_bridge,305,greg,2023-03-21,,,,"3/14: small eggs, GREG taken over by SMHE?" +2023,6th_bridge,305,greg,2023-03-28,,,,"3/14: small eggs, GREG taken over by SMHE?" +2023,6th_bridge,305,greg,2023-04-04,,,,"3/14: small eggs, GREG taken over by SMHE?" +2023,6th_bridge,305,greg,2023-04-15,,,,"3/14: small eggs, GREG taken over by SMHE?" +2023,6th_bridge,305,greg,2023-04-20,,,,"3/14: small eggs, GREG taken over by SMHE?" +2023,6th_bridge,305,greg,2023-04-27,,,,"3/14: small eggs, GREG taken over by SMHE?" +2023,6th_bridge,305,greg,2023-05-03,,,,"3/14: small eggs, GREG taken over by SMHE?" +2023,6th_bridge,*305,smwh,2023-02-22,,,,"small eggs" +2023,6th_bridge,*305,smwh,2023-03-01,,,,"small eggs" +2023,6th_bridge,*305,smwh,2023-03-08,1,,,"small eggs" +2023,6th_bridge,*305,smwh,2023-03-14,3,,incubating,"small eggs" +2023,6th_bridge,*305,smwh,2023-03-21,3,,incubating,"small eggs" +2023,6th_bridge,*305,smwh,2023-03-28,3,,incubating,"small eggs" +2023,6th_bridge,*305,smwh,2023-04-04,,3,nestling,"small eggs" +2023,6th_bridge,*305,smwh,2023-04-15,,,empty,"small eggs" +2023,6th_bridge,*305,smwh,2023-04-20,,,pulled,"small eggs" +2023,6th_bridge,*305,smwh,2023-04-27,,,,"small eggs" +2023,6th_bridge,*305,smwh,2023-05-03,,,,"small eggs" +2023,6th_bridge,355,trhe,2023-02-22,,,,"3/28: one dead egg in nest" +2023,6th_bridge,355,trhe,2023-03-01,,,,"3/28: one dead egg in nest" +2023,6th_bridge,355,trhe,2023-03-08,4,,incubating,"3/28: one dead egg in nest" +2023,6th_bridge,355,trhe,2023-03-14,4,,incubating,"3/28: one dead egg in nest" +2023,6th_bridge,355,trhe,2023-03-21,1,3,wet_chick,"3/28: one dead egg in nest" +2023,6th_bridge,355,trhe,2023-03-28,,3,nestling,"3/28: one dead egg in nest" +2023,6th_bridge,355,trhe,2023-04-04,,,missed,"3/28: one dead egg in nest" +2023,6th_bridge,355,trhe,2023-04-15,,,empty,"3/28: one dead egg in nest" +2023,6th_bridge,355,trhe,2023-04-20,,,empty,"3/28: one dead egg in nest" +2023,6th_bridge,355,trhe,2023-04-27,,,pulled,"3/28: one dead egg in nest" +2023,6th_bridge,355,trhe,2023-05-03,,,,"3/28: one dead egg in nest" +2023,6th_bridge,357,smwh,2023-02-22,,,,"4/20: flag pulled" +2023,6th_bridge,357,smwh,2023-03-01,,,,"4/20: flag pulled" +2023,6th_bridge,357,smwh,2023-03-08,3,,incubating,"4/20: flag pulled" +2023,6th_bridge,357,smwh,2023-03-14,3,,incubating,"4/20: flag pulled" +2023,6th_bridge,357,smwh,2023-03-21,1,2,chick_dry,"4/20: flag pulled" +2023,6th_bridge,357,smwh,2023-03-28,,3,nestling,"4/20: flag pulled" +2023,6th_bridge,357,smwh,2023-04-04,,,empty,"4/20: flag pulled" +2023,6th_bridge,357,smwh,2023-04-15,,,missed,"4/20: flag pulled" +2023,6th_bridge,357,smwh,2023-04-20,,,pulled,"4/20: flag pulled" +2023,6th_bridge,357,smwh,2023-04-27,,,,"4/20: flag pulled" +2023,6th_bridge,357,smwh,2023-05-03,,,,"4/20: flag pulled" +2023,6th_bridge,270,smwh,2023-02-22,,,,"3/8: small eggs, number originally missed in book from 3/1 3/28: smallest chick wet" +2023,6th_bridge,270,smwh,2023-03-01,,,,"3/8: small eggs, number originally missed in book from 3/1 3/28: smallest chick wet" +2023,6th_bridge,270,smwh,2023-03-08,4,,incubating,"3/8: small eggs, number originally missed in book from 3/1 3/28: smallest chick wet" +2023,6th_bridge,270,smwh,2023-03-14,4,,incubating,"3/8: small eggs, number originally missed in book from 3/1 3/28: smallest chick wet" +2023,6th_bridge,270,smwh,2023-03-21,4,,incubating,"3/8: small eggs, number originally missed in book from 3/1 3/28: smallest chick wet" +2023,6th_bridge,270,smwh,2023-03-28,,4,wet_chick,"3/8: small eggs, number originally missed in book from 3/1 3/28: smallest chick wet" +2023,6th_bridge,270,smwh,2023-04-04,,2,nestling,"3/8: small eggs, number originally missed in book from 3/1 3/28: smallest chick wet" +2023,6th_bridge,270,smwh,2023-04-15,,,empty,"3/8: small eggs, number originally missed in book from 3/1 3/28: smallest chick wet" +2023,6th_bridge,270,smwh,2023-04-20,,,pulled,"3/8: small eggs, number originally missed in book from 3/1 3/28: smallest chick wet" +2023,6th_bridge,270,smwh,2023-04-27,,,,"3/8: small eggs, number originally missed in book from 3/1 3/28: smallest chick wet" +2023,6th_bridge,270,smwh,2023-05-03,,,,"3/8: small eggs, number originally missed in book from 3/1 3/28: smallest chick wet" +2023,6th_bridge,262,smwh,2023-02-22,,,,"3/8: small eggs" +2023,6th_bridge,262,smwh,2023-03-01,4,,incubating,"3/8: small eggs" +2023,6th_bridge,262,smwh,2023-03-08,4,,incubating,"3/8: small eggs" +2023,6th_bridge,262,smwh,2023-03-14,4,,incubating,"3/8: small eggs" +2023,6th_bridge,262,smwh,2023-03-21,1,3,chick_dry,"3/8: small eggs" +2023,6th_bridge,262,smwh,2023-03-28,,4,nestling,"3/8: small eggs" +2023,6th_bridge,262,smwh,2023-04-04,,1,nestling,"3/8: small eggs" +2023,6th_bridge,262,smwh,2023-04-15,,,empty,"3/8: small eggs" +2023,6th_bridge,262,smwh,2023-04-20,,,pulled,"3/8: small eggs" +2023,6th_bridge,262,smwh,2023-04-27,,,,"3/8: small eggs" +2023,6th_bridge,262,smwh,2023-05-03,,,,"3/8: small eggs" +2023,6th_bridge,280,trhe,2023-02-22,,,,"3/14: SNEG yelling at us 3/28: eggs being incubated 4/20: flag pulled" +2023,6th_bridge,280,trhe,2023-03-01,2,,incubating,"3/14: SNEG yelling at us 3/28: eggs being incubated 4/20: flag pulled" +2023,6th_bridge,280,trhe,2023-03-08,1,,incubating,"3/14: SNEG yelling at us 3/28: eggs being incubated 4/20: flag pulled" +2023,6th_bridge,280,trhe,2023-03-14,3,,incubating,"3/14: SNEG yelling at us 3/28: eggs being incubated 4/20: flag pulled" +2023,6th_bridge,280,trhe,2023-03-21,2,,incubating,"3/14: SNEG yelling at us 3/28: eggs being incubated 4/20: flag pulled" +2023,6th_bridge,280,trhe,2023-03-28,2,,incubating,"3/14: SNEG yelling at us 3/28: eggs being incubated 4/20: flag pulled" +2023,6th_bridge,280,trhe,2023-04-04,,2,chick_dry,"3/14: SNEG yelling at us 3/28: eggs being incubated 4/20: flag pulled" +2023,6th_bridge,280,trhe,2023-04-15,,1,nestling,"3/14: SNEG yelling at us 3/28: eggs being incubated 4/20: flag pulled" +2023,6th_bridge,280,trhe,2023-04-20,,,empty,"3/14: SNEG yelling at us 3/28: eggs being incubated 4/20: flag pulled" +2023,6th_bridge,280,trhe,2023-04-27,,,,"3/14: SNEG yelling at us 3/28: eggs being incubated 4/20: flag pulled" +2023,6th_bridge,280,trhe,2023-05-03,,,,"3/14: SNEG yelling at us 3/28: eggs being incubated 4/20: flag pulled" +2023,6th_bridge,359,smhe,2023-02-22,,,, +2023,6th_bridge,359,smhe,2023-03-01,,,, +2023,6th_bridge,359,smhe,2023-03-08,2,,incubating, +2023,6th_bridge,359,smhe,2023-03-14,2,,incubating, +2023,6th_bridge,359,smhe,2023-03-21,2,,incubating, +2023,6th_bridge,359,smhe,2023-03-28,1,1,hatching, +2023,6th_bridge,359,smhe,2023-04-04,,2,nestling, +2023,6th_bridge,359,smhe,2023-04-15,,,empty, +2023,6th_bridge,359,smhe,2023-04-20,,,pulled, +2023,6th_bridge,359,smhe,2023-04-27,,,, +2023,6th_bridge,359,smhe,2023-05-03,,,, +2023,6th_bridge,433,bcnh,2023-02-22,,,,"4/4: flag pulled" +2023,6th_bridge,433,bcnh,2023-03-01,,,,"4/4: flag pulled" +2023,6th_bridge,433,bcnh,2023-03-08,,,,"4/4: flag pulled" +2023,6th_bridge,433,bcnh,2023-03-14,3,,incubating,"4/4: flag pulled" +2023,6th_bridge,433,bcnh,2023-03-21,,3,nestling,"4/4: flag pulled" +2023,6th_bridge,433,bcnh,2023-03-28,,2,nestling,"4/4: flag pulled" +2023,6th_bridge,433,bcnh,2023-04-04,,,empty,"4/4: flag pulled" +2023,6th_bridge,433,bcnh,2023-04-15,,,,"4/4: flag pulled" +2023,6th_bridge,433,bcnh,2023-04-20,,,,"4/4: flag pulled" +2023,6th_bridge,433,bcnh,2023-04-27,,,,"4/4: flag pulled" +2023,6th_bridge,433,bcnh,2023-05-03,,,,"4/4: flag pulled" +2023,6th_bridge,435,bcnh,2023-02-22,,,,"4/4: 3 dead eggs, very developed" +2023,6th_bridge,435,bcnh,2023-03-01,,,,"4/4: 3 dead eggs, very developed" +2023,6th_bridge,435,bcnh,2023-03-08,,,,"4/4: 3 dead eggs, very developed" +2023,6th_bridge,435,bcnh,2023-03-14,2,,incubating,"4/4: 3 dead eggs, very developed" +2023,6th_bridge,435,bcnh,2023-03-21,3,,incubating,"4/4: 3 dead eggs, very developed" +2023,6th_bridge,435,bcnh,2023-03-28,3,,incubating,"4/4: 3 dead eggs, very developed" +2023,6th_bridge,435,bcnh,2023-04-04,,,empty,"4/4: 3 dead eggs, very developed" +2023,6th_bridge,435,bcnh,2023-04-15,,,empty,"4/4: 3 dead eggs, very developed" +2023,6th_bridge,435,bcnh,2023-04-20,,,pulled,"4/4: 3 dead eggs, very developed" +2023,6th_bridge,435,bcnh,2023-04-27,,,,"4/4: 3 dead eggs, very developed" +2023,6th_bridge,435,bcnh,2023-05-03,,,,"4/4: 3 dead eggs, very developed" +2023,6th_bridge,278,whib,2023-02-22,,,,"3/14: one egg on ground" +2023,6th_bridge,278,whib,2023-03-01,2,,incubating,"3/14: one egg on ground" +2023,6th_bridge,278,whib,2023-03-08,2,,incubating,"3/14: one egg on ground" +2023,6th_bridge,278,whib,2023-03-14,1,,incubating,"3/14: one egg on ground" +2023,6th_bridge,278,whib,2023-03-21,,,empty,"3/14: one egg on ground" +2023,6th_bridge,278,whib,2023-03-28,,,empty,"3/14: one egg on ground" +2023,6th_bridge,278,whib,2023-04-04,,,,"3/14: one egg on ground" +2023,6th_bridge,278,whib,2023-04-15,,,,"3/14: one egg on ground" +2023,6th_bridge,278,whib,2023-04-20,,,,"3/14: one egg on ground" +2023,6th_bridge,278,whib,2023-04-27,,,,"3/14: one egg on ground" +2023,6th_bridge,278,whib,2023-05-03,,,,"3/14: one egg on ground" +2023,6th_bridge,*278,smhe,2023-02-22,,,,"4/4: flag pulled" +2023,6th_bridge,*278,smhe,2023-03-01,,,,"4/4: flag pulled" +2023,6th_bridge,*278,smhe,2023-03-08,,,,"4/4: flag pulled" +2023,6th_bridge,*278,smhe,2023-03-14,,,,"4/4: flag pulled" +2023,6th_bridge,*278,smhe,2023-03-21,,,,"4/4: flag pulled" +2023,6th_bridge,*278,smhe,2023-03-28,3,,incubating,"4/4: flag pulled" +2023,6th_bridge,*278,smhe,2023-04-04,,,empty,"4/4: flag pulled" +2023,6th_bridge,*278,smhe,2023-04-15,,,,"4/4: flag pulled" +2023,6th_bridge,*278,smhe,2023-04-20,,,,"4/4: flag pulled" +2023,6th_bridge,*278,smhe,2023-04-27,,,,"4/4: flag pulled" +2023,6th_bridge,*278,smhe,2023-05-03,,,,"4/4: flag pulled" +2023,6th_bridge,276,bcnh,2023-02-22,,,,"3/8: big eggs 4/20: long-dead BCNH chick in nest" +2023,6th_bridge,276,bcnh,2023-03-01,3,,incubating,"3/8: big eggs 4/20: long-dead BCNH chick in nest" +2023,6th_bridge,276,bcnh,2023-03-08,3,,incubating,"3/8: big eggs 4/20: long-dead BCNH chick in nest" +2023,6th_bridge,276,bcnh,2023-03-14,2,,incubating,"3/8: big eggs 4/20: long-dead BCNH chick in nest" +2023,6th_bridge,276,bcnh,2023-03-21,,2,nestling,"3/8: big eggs 4/20: long-dead BCNH chick in nest" +2023,6th_bridge,276,bcnh,2023-03-28,,2,nestling,"3/8: big eggs 4/20: long-dead BCNH chick in nest" +2023,6th_bridge,276,bcnh,2023-04-04,,1,nestling,"3/8: big eggs 4/20: long-dead BCNH chick in nest" +2023,6th_bridge,276,bcnh,2023-04-15,,,empty,"3/8: big eggs 4/20: long-dead BCNH chick in nest" +2023,6th_bridge,276,bcnh,2023-04-20,,,pulled,"3/8: big eggs 4/20: long-dead BCNH chick in nest" +2023,6th_bridge,276,bcnh,2023-04-27,,,,"3/8: big eggs 4/20: long-dead BCNH chick in nest" +2023,6th_bridge,276,bcnh,2023-05-03,,,,"3/8: big eggs 4/20: long-dead BCNH chick in nest" +2023,6th_bridge,272,whib,2023-02-22,,,,"4/4: 2 chicks certain" +2023,6th_bridge,272,whib,2023-03-01,2,,incubating,"4/4: 2 chicks certain" +2023,6th_bridge,272,whib,2023-03-08,2,,incubating,"4/4: 2 chicks certain" +2023,6th_bridge,272,whib,2023-03-14,1,,incubating,"4/4: 2 chicks certain" +2023,6th_bridge,272,whib,2023-03-21,2,,incubating,"4/4: 2 chicks certain" +2023,6th_bridge,272,whib,2023-03-28,,,missed,"4/4: 2 chicks certain" +2023,6th_bridge,272,whib,2023-04-04,,2,nestling,"4/4: 2 chicks certain" +2023,6th_bridge,272,whib,2023-04-15,,,empty,"4/4: 2 chicks certain" +2023,6th_bridge,272,whib,2023-04-20,,,pulled,"4/4: 2 chicks certain" +2023,6th_bridge,272,whib,2023-04-27,,,,"4/4: 2 chicks certain" +2023,6th_bridge,272,whib,2023-05-03,,,,"4/4: 2 chicks certain" +2023,6th_bridge,274,whib,2023-02-22,,,,"3/21: certain 2 chicks" +2023,6th_bridge,274,whib,2023-03-01,3,,incubating,"3/21: certain 2 chicks" +2023,6th_bridge,274,whib,2023-03-08,3,,incubating,"3/21: certain 2 chicks" +2023,6th_bridge,274,whib,2023-03-14,3,,incubating,"3/21: certain 2 chicks" +2023,6th_bridge,274,whib,2023-03-21,,2,nestling,"3/21: certain 2 chicks" +2023,6th_bridge,274,whib,2023-03-28,,,missed,"3/21: certain 2 chicks" +2023,6th_bridge,274,whib,2023-04-04,,,missed,"3/21: certain 2 chicks" +2023,6th_bridge,274,whib,2023-04-15,,,empty,"3/21: certain 2 chicks" +2023,6th_bridge,274,whib,2023-04-20,,,empty,"3/21: certain 2 chicks" +2023,6th_bridge,274,whib,2023-04-27,,,pulled,"3/21: certain 2 chicks" +2023,6th_bridge,274,whib,2023-05-03,,,,"3/21: certain 2 chicks" +2023,6th_bridge,282,smwh,2023-02-22,,,,"3/8: very small eggs 4/20: flag pulled" +2023,6th_bridge,282,smwh,2023-03-01,3,,incubating,"3/8: very small eggs 4/20: flag pulled" +2023,6th_bridge,282,smwh,2023-03-08,3,,incubating,"3/8: very small eggs 4/20: flag pulled" +2023,6th_bridge,282,smwh,2023-03-14,3,,incubating,"3/8: very small eggs 4/20: flag pulled" +2023,6th_bridge,282,smwh,2023-03-21,,3,nestling,"3/8: very small eggs 4/20: flag pulled" +2023,6th_bridge,282,smwh,2023-03-28,,3,nestling,"3/8: very small eggs 4/20: flag pulled" +2023,6th_bridge,282,smwh,2023-04-04,,2,nestling,"3/8: very small eggs 4/20: flag pulled" +2023,6th_bridge,282,smwh,2023-04-15,,2,nestling,"3/8: very small eggs 4/20: flag pulled" +2023,6th_bridge,282,smwh,2023-04-20,,,empty,"3/8: very small eggs 4/20: flag pulled" +2023,6th_bridge,282,smwh,2023-04-27,,,,"3/8: very small eggs 4/20: flag pulled" +2023,6th_bridge,282,smwh,2023-05-03,,,,"3/8: very small eggs 4/20: flag pulled" +2023,6th_bridge,284,whib,2023-02-22,,,,"3/28: takeover by SMHE" +2023,6th_bridge,284,whib,2023-03-01,2,,incubating,"3/28: takeover by SMHE" +2023,6th_bridge,284,whib,2023-03-08,2,,incubating,"3/28: takeover by SMHE" +2023,6th_bridge,284,whib,2023-03-14,2,,incubating,"3/28: takeover by SMHE" +2023,6th_bridge,284,whib,2023-03-21,,,empty,"3/28: takeover by SMHE" +2023,6th_bridge,284,whib,2023-03-28,,,empty,"3/28: takeover by SMHE" +2023,6th_bridge,284,whib,2023-04-04,,,,"3/28: takeover by SMHE" +2023,6th_bridge,284,whib,2023-04-15,,,,"3/28: takeover by SMHE" +2023,6th_bridge,284,whib,2023-04-20,,,,"3/28: takeover by SMHE" +2023,6th_bridge,284,whib,2023-04-27,,,,"3/28: takeover by SMHE" +2023,6th_bridge,284,whib,2023-05-03,,,,"3/28: takeover by SMHE" +2023,6th_bridge,*284,smhe,2023-02-22,,,,"4/27: one big chick dead under nest, probably not from the same nest. Additionally, 3 eggshells underneath nest" +2023,6th_bridge,*284,smhe,2023-03-01,,,,"4/27: one big chick dead under nest, probably not from the same nest. Additionally, 3 eggshells underneath nest" +2023,6th_bridge,*284,smhe,2023-03-08,,,,"4/27: one big chick dead under nest, probably not from the same nest. Additionally, 3 eggshells underneath nest" +2023,6th_bridge,*284,smhe,2023-03-14,,,,"4/27: one big chick dead under nest, probably not from the same nest. Additionally, 3 eggshells underneath nest" +2023,6th_bridge,*284,smhe,2023-03-21,,,,"4/27: one big chick dead under nest, probably not from the same nest. Additionally, 3 eggshells underneath nest" +2023,6th_bridge,*284,smhe,2023-03-28,3,,incubating,"4/27: one big chick dead under nest, probably not from the same nest. Additionally, 3 eggshells underneath nest" +2023,6th_bridge,*284,smhe,2023-04-04,5,,incubating,"4/27: one big chick dead under nest, probably not from the same nest. Additionally, 3 eggshells underneath nest" +2023,6th_bridge,*284,smhe,2023-04-15,5,,incubating,"4/27: one big chick dead under nest, probably not from the same nest. Additionally, 3 eggshells underneath nest" +2023,6th_bridge,*284,smhe,2023-04-20,5,,incubating,"4/27: one big chick dead under nest, probably not from the same nest. Additionally, 3 eggshells underneath nest" +2023,6th_bridge,*284,smhe,2023-04-27,,,empty,"4/27: one big chick dead under nest, probably not from the same nest. Additionally, 3 eggshells underneath nest" +2023,6th_bridge,*284,smhe,2023-05-03,,,,"4/27: one big chick dead under nest, probably not from the same nest. Additionally, 3 eggshells underneath nest" +2023,6th_bridge,286,whib,2023-02-22,,,,"4/20: Chicks look possibly GLIB" +2023,6th_bridge,286,whib,2023-03-01,2,,incubating,"4/20: Chicks look possibly GLIB" +2023,6th_bridge,286,whib,2023-03-08,2,,incubating,"4/20: Chicks look possibly GLIB" +2023,6th_bridge,286,whib,2023-03-14,,,empty,"4/20: Chicks look possibly GLIB" +2023,6th_bridge,286,whib,2023-03-21,3,,incubating,"4/20: Chicks look possibly GLIB" +2023,6th_bridge,286,whib,2023-03-28,3,,incubating,"4/20: Chicks look possibly GLIB" +2023,6th_bridge,286,whib,2023-04-04,3,,incubating,"4/20: Chicks look possibly GLIB" +2023,6th_bridge,286,whib,2023-04-15,,2,nestling,"4/20: Chicks look possibly GLIB" +2023,6th_bridge,286,whib,2023-04-20,,2,nestling,"4/20: Chicks look possibly GLIB" +2023,6th_bridge,286,whib,2023-04-27,,,empty,"4/20: Chicks look possibly GLIB" +2023,6th_bridge,286,whib,2023-05-03,,,,"4/20: Chicks look possibly GLIB" +2023,6th_bridge,264,whib,2023-02-22,,,, +2023,6th_bridge,264,whib,2023-03-01,2,,incubating, +2023,6th_bridge,264,whib,2023-03-08,2,,incubating, +2023,6th_bridge,264,whib,2023-03-14,2,,incubating, +2023,6th_bridge,264,whib,2023-03-21,,,empty, +2023,6th_bridge,264,whib,2023-03-28,,,empty, +2023,6th_bridge,264,whib,2023-04-04,,,, +2023,6th_bridge,264,whib,2023-04-15,,,, +2023,6th_bridge,264,whib,2023-04-20,,,, +2023,6th_bridge,264,whib,2023-04-27,,,, +2023,6th_bridge,264,whib,2023-05-03,,,, +2023,6th_bridge,*264,glib,2023-02-22,,,, +2023,6th_bridge,*264,glib,2023-03-01,,,, +2023,6th_bridge,*264,glib,2023-03-08,,,, +2023,6th_bridge,*264,glib,2023-03-14,,,, +2023,6th_bridge,*264,glib,2023-03-21,,,, +2023,6th_bridge,*264,glib,2023-03-28,2,,incubating, +2023,6th_bridge,*264,glib,2023-04-04,2,,incubating, +2023,6th_bridge,*264,glib,2023-04-15,,,empty, +2023,6th_bridge,*264,glib,2023-04-20,,,pulled, +2023,6th_bridge,*264,glib,2023-04-27,,,, +2023,6th_bridge,*264,glib,2023-05-03,,,, +2023,6th_bridge,266,whib,2023-02-22,,,, +2023,6th_bridge,266,whib,2023-03-01,3,,incubating, +2023,6th_bridge,266,whib,2023-03-08,3,,incubating, +2023,6th_bridge,266,whib,2023-03-14,3,,incubating, +2023,6th_bridge,266,whib,2023-03-21,3,,incubating, +2023,6th_bridge,266,whib,2023-03-28,2,,incubating, +2023,6th_bridge,266,whib,2023-04-04,,,empty, +2023,6th_bridge,266,whib,2023-04-15,,,empty, +2023,6th_bridge,266,whib,2023-04-20,,,pulled, +2023,6th_bridge,266,whib,2023-04-27,,,, +2023,6th_bridge,266,whib,2023-05-03,,,, +2023,6th_bridge,268,whib,2023-02-22,,,, +2023,6th_bridge,268,whib,2023-03-01,2,,incubating, +2023,6th_bridge,268,whib,2023-03-08,2,,incubating, +2023,6th_bridge,268,whib,2023-03-14,2,,incubating, +2023,6th_bridge,268,whib,2023-03-21,,,empty, +2023,6th_bridge,268,whib,2023-03-28,,,empty, +2023,6th_bridge,268,whib,2023-04-04,,,empty, +2023,6th_bridge,268,whib,2023-04-15,,,empty, +2023,6th_bridge,268,whib,2023-04-20,,,pulled, +2023,6th_bridge,268,whib,2023-04-27,,,, +2023,6th_bridge,268,whib,2023-05-03,,,, +2023,6th_bridge,361,smhe,2023-02-22,,,,"3/21: nest possibly collapsed in on itself; BCNH?; 4/4: flag pulled" +2023,6th_bridge,361,smhe,2023-03-01,,,,"3/21: nest possibly collapsed in on itself; BCNH?; 4/4: flag pulled" +2023,6th_bridge,361,smhe,2023-03-08,2,,incubating,"3/21: nest possibly collapsed in on itself; BCNH?; 4/4: flag pulled" +2023,6th_bridge,361,smhe,2023-03-14,3,,incubating,"3/21: nest possibly collapsed in on itself; BCNH?; 4/4: flag pulled" +2023,6th_bridge,361,smhe,2023-03-21,2,,incubating,"3/21: nest possibly collapsed in on itself; BCNH?; 4/4: flag pulled" +2023,6th_bridge,361,smhe,2023-03-28,,,empty,"3/21: nest possibly collapsed in on itself; BCNH?; 4/4: flag pulled" +2023,6th_bridge,361,smhe,2023-04-04,,,pulled,"3/21: nest possibly collapsed in on itself; BCNH?; 4/4: flag pulled" +2023,6th_bridge,361,smhe,2023-04-15,,,,"3/21: nest possibly collapsed in on itself; BCNH?; 4/4: flag pulled" +2023,6th_bridge,361,smhe,2023-04-20,,,,"3/21: nest possibly collapsed in on itself; BCNH?; 4/4: flag pulled" +2023,6th_bridge,361,smhe,2023-04-27,,,,"3/21: nest possibly collapsed in on itself; BCNH?; 4/4: flag pulled" +2023,6th_bridge,361,smhe,2023-05-03,,,,"3/21: nest possibly collapsed in on itself; BCNH?; 4/4: flag pulled" +2023,6th_bridge,437,whib,2023-02-22,,,, +2023,6th_bridge,437,whib,2023-03-01,,,, +2023,6th_bridge,437,whib,2023-03-08,,,, +2023,6th_bridge,437,whib,2023-03-14,2,,incubating, +2023,6th_bridge,437,whib,2023-03-21,,1,nestling, +2023,6th_bridge,437,whib,2023-03-28,,1,nestling, +2023,6th_bridge,437,whib,2023-04-04,,1,nestling, +2023,6th_bridge,437,whib,2023-04-15,,,empty, +2023,6th_bridge,437,whib,2023-04-20,,,pulled, +2023,6th_bridge,437,whib,2023-04-27,,,, +2023,6th_bridge,437,whib,2023-05-03,,,, +2023,6th_bridge,518,bcnh,2023-02-22,,,, +2023,6th_bridge,518,bcnh,2023-03-01,,,, +2023,6th_bridge,518,bcnh,2023-03-08,,,, +2023,6th_bridge,518,bcnh,2023-03-14,,,, +2023,6th_bridge,518,bcnh,2023-03-21,1,,incubating, +2023,6th_bridge,518,bcnh,2023-03-28,,,missed, +2023,6th_bridge,518,bcnh,2023-04-04,,,empty, +2023,6th_bridge,518,bcnh,2023-04-15,,,empty, +2023,6th_bridge,518,bcnh,2023-04-20,,,pulled, +2023,6th_bridge,518,bcnh,2023-04-27,,,, +2023,6th_bridge,518,bcnh,2023-05-03,,,, +2023,6th_bridge,288,whib,2023-02-22,,,, +2023,6th_bridge,288,whib,2023-03-01,2,,incubating, +2023,6th_bridge,288,whib,2023-03-08,2,,incubating, +2023,6th_bridge,288,whib,2023-03-14,2,,incubating, +2023,6th_bridge,288,whib,2023-03-21,,1,nestling, +2023,6th_bridge,288,whib,2023-03-28,,,empty, +2023,6th_bridge,288,whib,2023-04-04,,,empty, +2023,6th_bridge,288,whib,2023-04-15,,,empty, +2023,6th_bridge,288,whib,2023-04-20,,,pulled, +2023,6th_bridge,288,whib,2023-04-27,,,, +2023,6th_bridge,288,whib,2023-05-03,,,, +2023,6th_bridge,290,whib,2023-02-22,,,, +2023,6th_bridge,290,whib,2023-03-01,3,,incubating, +2023,6th_bridge,290,whib,2023-03-08,3,,incubating, +2023,6th_bridge,290,whib,2023-03-14,3,,incubating, +2023,6th_bridge,290,whib,2023-03-21,,2,nestling, +2023,6th_bridge,290,whib,2023-03-28,,1,nestling, +2023,6th_bridge,290,whib,2023-04-04,,,empty, +2023,6th_bridge,290,whib,2023-04-15,,,empty, +2023,6th_bridge,290,whib,2023-04-20,,,pulled, +2023,6th_bridge,290,whib,2023-04-27,,,, +2023,6th_bridge,290,whib,2023-05-03,,,, +2023,6th_bridge,292,whib,2023-02-22,,,,"3/28: one chick possibly ran into the nest" +2023,6th_bridge,292,whib,2023-03-01,2,,incubating,"3/28: one chick possibly ran into the nest" +2023,6th_bridge,292,whib,2023-03-08,2,,incubating,"3/28: one chick possibly ran into the nest" +2023,6th_bridge,292,whib,2023-03-14,1,,incubating,"3/28: one chick possibly ran into the nest" +2023,6th_bridge,292,whib,2023-03-21,,1,nestling,"3/28: one chick possibly ran into the nest" +2023,6th_bridge,292,whib,2023-03-28,,2,nestling,"3/28: one chick possibly ran into the nest" +2023,6th_bridge,292,whib,2023-04-04,,,empty,"3/28: one chick possibly ran into the nest" +2023,6th_bridge,292,whib,2023-04-15,,,empty,"3/28: one chick possibly ran into the nest" +2023,6th_bridge,292,whib,2023-04-20,,,pulled,"3/28: one chick possibly ran into the nest" +2023,6th_bridge,292,whib,2023-04-27,,,,"3/28: one chick possibly ran into the nest" +2023,6th_bridge,292,whib,2023-05-03,,,,"3/28: one chick possibly ran into the nest" +2023,6th_bridge,294,whib,2023-02-22,,,,"4/4: 2 chicks above nest" +2023,6th_bridge,294,whib,2023-03-01,2,,incubating,"4/4: 2 chicks above nest" +2023,6th_bridge,294,whib,2023-03-08,2,,incubating,"4/4: 2 chicks above nest" +2023,6th_bridge,294,whib,2023-03-14,2,,incubating,"4/4: 2 chicks above nest" +2023,6th_bridge,294,whib,2023-03-21,2,1,hatching,"4/4: 2 chicks above nest" +2023,6th_bridge,294,whib,2023-03-28,1,1,hatching,"4/4: 2 chicks above nest" +2023,6th_bridge,294,whib,2023-04-04,,2,nestling,"4/4: 2 chicks above nest" +2023,6th_bridge,294,whib,2023-04-15,,,empty,"4/4: 2 chicks above nest" +2023,6th_bridge,294,whib,2023-04-20,,,pulled,"4/4: 2 chicks above nest" +2023,6th_bridge,294,whib,2023-04-27,,,,"4/4: 2 chicks above nest" +2023,6th_bridge,294,whib,2023-05-03,,,,"4/4: 2 chicks above nest" +2023,6th_bridge,296,whib,2023-02-22,,,,"3/14: one egg pipping 3/28: chick big, on the run" +2023,6th_bridge,296,whib,2023-03-01,3,,incubating,"3/14: one egg pipping 3/28: chick big, on the run" +2023,6th_bridge,296,whib,2023-03-08,3,,incubating,"3/14: one egg pipping 3/28: chick big, on the run" +2023,6th_bridge,296,whib,2023-03-14,3,,pipping,"3/14: one egg pipping 3/28: chick big, on the run" +2023,6th_bridge,296,whib,2023-03-21,,3,nestling,"3/14: one egg pipping 3/28: chick big, on the run" +2023,6th_bridge,296,whib,2023-03-28,,1,nestling,"3/14: one egg pipping 3/28: chick big, on the run" +2023,6th_bridge,296,whib,2023-04-04,,,empty,"3/14: one egg pipping 3/28: chick big, on the run" +2023,6th_bridge,296,whib,2023-04-15,,,missed,"3/14: one egg pipping 3/28: chick big, on the run" +2023,6th_bridge,296,whib,2023-04-20,,,pulled,"3/14: one egg pipping 3/28: chick big, on the run" +2023,6th_bridge,296,whib,2023-04-27,,,,"3/14: one egg pipping 3/28: chick big, on the run" +2023,6th_bridge,296,whib,2023-05-03,,,,"3/14: one egg pipping 3/28: chick big, on the run" +2023,6th_bridge,520,glib,2023-02-22,,,,"4/15: nest gone" +2023,6th_bridge,520,glib,2023-03-01,,,,"4/15: nest gone" +2023,6th_bridge,520,glib,2023-03-08,,,,"4/15: nest gone" +2023,6th_bridge,520,glib,2023-03-14,,,,"4/15: nest gone" +2023,6th_bridge,520,glib,2023-03-21,1,,incubating,"4/15: nest gone" +2023,6th_bridge,520,glib,2023-03-28,3,,incubating,"4/15: nest gone" +2023,6th_bridge,520,glib,2023-04-04,3,,incubating,"4/15: nest gone" +2023,6th_bridge,520,glib,2023-04-15,,,empty,"4/15: nest gone" +2023,6th_bridge,520,glib,2023-04-20,,,pulled,"4/15: nest gone" +2023,6th_bridge,520,glib,2023-04-27,,,,"4/15: nest gone" +2023,6th_bridge,520,glib,2023-05-03,,,,"4/15: nest gone" +2023,6th_bridge,298,whib,2023-02-22,,,,"3/14: nest gone 3/21: branch now on ground; 4/4: flag pulled" +2023,6th_bridge,298,whib,2023-03-01,2,,incubating,"3/14: nest gone 3/21: branch now on ground; 4/4: flag pulled" +2023,6th_bridge,298,whib,2023-03-08,2,,incubating,"3/14: nest gone 3/21: branch now on ground; 4/4: flag pulled" +2023,6th_bridge,298,whib,2023-03-14,,,empty,"3/14: nest gone 3/21: branch now on ground; 4/4: flag pulled" +2023,6th_bridge,298,whib,2023-03-21,,,empty,"3/14: nest gone 3/21: branch now on ground; 4/4: flag pulled" +2023,6th_bridge,298,whib,2023-03-28,,,,"3/14: nest gone 3/21: branch now on ground; 4/4: flag pulled" +2023,6th_bridge,298,whib,2023-04-04,,,pulled,"3/14: nest gone 3/21: branch now on ground; 4/4: flag pulled" +2023,6th_bridge,298,whib,2023-04-15,,,,"3/14: nest gone 3/21: branch now on ground; 4/4: flag pulled" +2023,6th_bridge,298,whib,2023-04-20,,,,"3/14: nest gone 3/21: branch now on ground; 4/4: flag pulled" +2023,6th_bridge,298,whib,2023-04-27,,,,"3/14: nest gone 3/21: branch now on ground; 4/4: flag pulled" +2023,6th_bridge,298,whib,2023-05-03,,,,"3/14: nest gone 3/21: branch now on ground; 4/4: flag pulled" +2023,6th_bridge,439,whib,2023-02-22,,,,"3/21: nest gone, branch now on ground; 4/4: flag pulled" +2023,6th_bridge,439,whib,2023-03-01,,,,"3/21: nest gone, branch now on ground; 4/4: flag pulled" +2023,6th_bridge,439,whib,2023-03-08,,,,"3/21: nest gone, branch now on ground; 4/4: flag pulled" +2023,6th_bridge,439,whib,2023-03-14,1,,incubating,"3/21: nest gone, branch now on ground; 4/4: flag pulled" +2023,6th_bridge,439,whib,2023-03-21,,,empty,"3/21: nest gone, branch now on ground; 4/4: flag pulled" +2023,6th_bridge,439,whib,2023-03-28,,,,"3/21: nest gone, branch now on ground; 4/4: flag pulled" +2023,6th_bridge,439,whib,2023-04-04,,,pulled,"3/21: nest gone, branch now on ground; 4/4: flag pulled" +2023,6th_bridge,439,whib,2023-04-15,,,,"3/21: nest gone, branch now on ground; 4/4: flag pulled" +2023,6th_bridge,439,whib,2023-04-20,,,,"3/21: nest gone, branch now on ground; 4/4: flag pulled" +2023,6th_bridge,439,whib,2023-04-27,,,,"3/21: nest gone, branch now on ground; 4/4: flag pulled" +2023,6th_bridge,439,whib,2023-05-03,,,,"3/21: nest gone, branch now on ground; 4/4: flag pulled" +2023,6th_bridge,312,whib,2023-02-22,,,, +2023,6th_bridge,312,whib,2023-03-01,3,,incubating, +2023,6th_bridge,312,whib,2023-03-08,3,,incubating, +2023,6th_bridge,312,whib,2023-03-14,,,empty, +2023,6th_bridge,312,whib,2023-03-21,,,empty, +2023,6th_bridge,312,whib,2023-03-28,,,empty, +2023,6th_bridge,312,whib,2023-04-04,,,empty, +2023,6th_bridge,312,whib,2023-04-15,,,missed, +2023,6th_bridge,312,whib,2023-04-20,,,missed, +2023,6th_bridge,312,whib,2023-04-27,,,missed, +2023,6th_bridge,312,whib,2023-05-03,,,missed, +2023,6th_bridge,314,whib,2023-02-22,,,, +2023,6th_bridge,314,whib,2023-03-01,3,,incubating, +2023,6th_bridge,314,whib,2023-03-08,3,,incubating, +2023,6th_bridge,314,whib,2023-03-14,3,,incubating, +2023,6th_bridge,314,whib,2023-03-21,,1,nestling, +2023,6th_bridge,314,whib,2023-03-28,,1,nestling, +2023,6th_bridge,314,whib,2023-04-04,,,empty, +2023,6th_bridge,314,whib,2023-04-15,,,missed, +2023,6th_bridge,314,whib,2023-04-20,,,missed, +2023,6th_bridge,314,whib,2023-04-27,,,missed, +2023,6th_bridge,314,whib,2023-05-03,,,missed, +2023,6th_bridge,300,smwh,2023-02-22,,,,"3/14: 3 C certain; 4/4: flag pulled" +2023,6th_bridge,300,smwh,2023-03-01,4,,incubating,"3/14: 3 C certain; 4/4: flag pulled" +2023,6th_bridge,300,smwh,2023-03-08,4,,incubating,"3/14: 3 C certain; 4/4: flag pulled" +2023,6th_bridge,300,smwh,2023-03-14,,3,nestling,"3/14: 3 C certain; 4/4: flag pulled" +2023,6th_bridge,300,smwh,2023-03-21,,4,nestling,"3/14: 3 C certain; 4/4: flag pulled" +2023,6th_bridge,300,smwh,2023-03-28,,1,nestling,"3/14: 3 C certain; 4/4: flag pulled" +2023,6th_bridge,300,smwh,2023-04-04,,,empty,"3/14: 3 C certain; 4/4: flag pulled" +2023,6th_bridge,300,smwh,2023-04-15,,,,"3/14: 3 C certain; 4/4: flag pulled" +2023,6th_bridge,300,smwh,2023-04-20,,,,"3/14: 3 C certain; 4/4: flag pulled" +2023,6th_bridge,300,smwh,2023-04-27,,,,"3/14: 3 C certain; 4/4: flag pulled" +2023,6th_bridge,300,smwh,2023-05-03,,,,"3/14: 3 C certain; 4/4: flag pulled" +2023,6th_bridge,316,rosp,2023-02-22,,,,"3/14: egg is either pipping or cracked/dead" +2023,6th_bridge,316,rosp,2023-03-01,4,,incubating,"3/14: egg is either pipping or cracked/dead" +2023,6th_bridge,316,rosp,2023-03-08,4,,incubating,"3/14: egg is either pipping or cracked/dead" +2023,6th_bridge,316,rosp,2023-03-14,1,2,hatching,"3/14: egg is either pipping or cracked/dead" +2023,6th_bridge,316,rosp,2023-03-21,,,empty,"3/14: egg is either pipping or cracked/dead" +2023,6th_bridge,316,rosp,2023-03-28,,,empty,"3/14: egg is either pipping or cracked/dead" +2023,6th_bridge,316,rosp,2023-04-04,,,,"3/14: egg is either pipping or cracked/dead" +2023,6th_bridge,316,rosp,2023-04-15,,,,"3/14: egg is either pipping or cracked/dead" +2023,6th_bridge,316,rosp,2023-04-20,,,,"3/14: egg is either pipping or cracked/dead" +2023,6th_bridge,316,rosp,2023-04-27,,,,"3/14: egg is either pipping or cracked/dead" +2023,6th_bridge,316,rosp,2023-05-03,,,,"3/14: egg is either pipping or cracked/dead" +2023,6th_bridge,*316,glib,2023-02-22,,,,"4/4: GLIB takeover 4/20: flag pulled" +2023,6th_bridge,*316,glib,2023-03-01,,,,"4/4: GLIB takeover 4/20: flag pulled" +2023,6th_bridge,*316,glib,2023-03-08,,,,"4/4: GLIB takeover 4/20: flag pulled" +2023,6th_bridge,*316,glib,2023-03-14,,,,"4/4: GLIB takeover 4/20: flag pulled" +2023,6th_bridge,*316,glib,2023-03-21,,,,"4/4: GLIB takeover 4/20: flag pulled" +2023,6th_bridge,*316,glib,2023-03-28,,,,"4/4: GLIB takeover 4/20: flag pulled" +2023,6th_bridge,*316,glib,2023-04-04,2,,incubating,"4/4: GLIB takeover 4/20: flag pulled" +2023,6th_bridge,*316,glib,2023-04-15,2,,incubating,"4/4: GLIB takeover 4/20: flag pulled" +2023,6th_bridge,*316,glib,2023-04-20,,,empty,"4/4: GLIB takeover 4/20: flag pulled" +2023,6th_bridge,*316,glib,2023-04-27,,,,"4/4: GLIB takeover 4/20: flag pulled" +2023,6th_bridge,*316,glib,2023-05-03,,,,"4/4: GLIB takeover 4/20: flag pulled" +2023,6th_bridge,441,whib,2023-02-22,,,,"4/4: chick big; 4/27: flag pulled" +2023,6th_bridge,441,whib,2023-03-01,,,,"4/4: chick big; 4/27: flag pulled" +2023,6th_bridge,441,whib,2023-03-08,,,,"4/4: chick big; 4/27: flag pulled" +2023,6th_bridge,441,whib,2023-03-14,2,,incubating,"4/4: chick big; 4/27: flag pulled" +2023,6th_bridge,441,whib,2023-03-21,2,,incubating,"4/4: chick big; 4/27: flag pulled" +2023,6th_bridge,441,whib,2023-03-28,,2,nestling,"4/4: chick big; 4/27: flag pulled" +2023,6th_bridge,441,whib,2023-04-04,,1,nestling,"4/4: chick big; 4/27: flag pulled" +2023,6th_bridge,441,whib,2023-04-15,,,empty,"4/4: chick big; 4/27: flag pulled" +2023,6th_bridge,441,whib,2023-04-20,,,missed,"4/4: chick big; 4/27: flag pulled" +2023,6th_bridge,441,whib,2023-04-27,,,empty,"4/4: chick big; 4/27: flag pulled" +2023,6th_bridge,441,whib,2023-05-03,,,,"4/4: chick big; 4/27: flag pulled" +2023,6th_bridge,443,smhe,2023-02-22,,,,"3/14: small eggs; 4/4: egg dead + one dead chick on ground 4/15:1 live chick and one dead chick 4/20: flag pulled" +2023,6th_bridge,443,smhe,2023-03-01,,,,"3/14: small eggs; 4/4: egg dead + one dead chick on ground 4/15:1 live chick and one dead chick 4/20: flag pulled" +2023,6th_bridge,443,smhe,2023-03-08,,,,"3/14: small eggs; 4/4: egg dead + one dead chick on ground 4/15:1 live chick and one dead chick 4/20: flag pulled" +2023,6th_bridge,443,smhe,2023-03-14,4,,incubating,"3/14: small eggs; 4/4: egg dead + one dead chick on ground 4/15:1 live chick and one dead chick 4/20: flag pulled" +2023,6th_bridge,443,smhe,2023-03-21,4,,incubating,"3/14: small eggs; 4/4: egg dead + one dead chick on ground 4/15:1 live chick and one dead chick 4/20: flag pulled" +2023,6th_bridge,443,smhe,2023-03-28,1,3,hatching,"3/14: small eggs; 4/4: egg dead + one dead chick on ground 4/15:1 live chick and one dead chick 4/20: flag pulled" +2023,6th_bridge,443,smhe,2023-04-04,1,2,nestling,"3/14: small eggs; 4/4: egg dead + one dead chick on ground 4/15:1 live chick and one dead chick 4/20: flag pulled" +2023,6th_bridge,443,smhe,2023-04-15,,1,nestling,"3/14: small eggs; 4/4: egg dead + one dead chick on ground 4/15:1 live chick and one dead chick 4/20: flag pulled" +2023,6th_bridge,443,smhe,2023-04-20,,,empty,"3/14: small eggs; 4/4: egg dead + one dead chick on ground 4/15:1 live chick and one dead chick 4/20: flag pulled" +2023,6th_bridge,443,smhe,2023-04-27,,,,"3/14: small eggs; 4/4: egg dead + one dead chick on ground 4/15:1 live chick and one dead chick 4/20: flag pulled" +2023,6th_bridge,443,smhe,2023-05-03,,,,"3/14: small eggs; 4/4: egg dead + one dead chick on ground 4/15:1 live chick and one dead chick 4/20: flag pulled" +2023,6th_bridge,522,glib,2023-02-22,,,,"4/20: flag pulled" +2023,6th_bridge,522,glib,2023-03-01,,,,"4/20: flag pulled" +2023,6th_bridge,522,glib,2023-03-08,,,,"4/20: flag pulled" +2023,6th_bridge,522,glib,2023-03-14,,,,"4/20: flag pulled" +2023,6th_bridge,522,glib,2023-03-21,1,,incubating,"4/20: flag pulled" +2023,6th_bridge,522,glib,2023-03-28,2,,incubating,"4/20: flag pulled" +2023,6th_bridge,522,glib,2023-04-04,2,,incubating,"4/20: flag pulled" +2023,6th_bridge,522,glib,2023-04-15,,,missed,"4/20: flag pulled" +2023,6th_bridge,522,glib,2023-04-20,,,empty,"4/20: flag pulled" +2023,6th_bridge,522,glib,2023-04-27,,,,"4/20: flag pulled" +2023,6th_bridge,522,glib,2023-05-03,,,,"4/20: flag pulled" +2023,6th_bridge,302,whib,2023-02-22,,,,"3/1: 5 eggs total in nest, 2 whib + 3 anhi 3/8: flag from nest on ground, re-used to mark a different nest" +2023,6th_bridge,302,whib,2023-03-01,2,,incubating,"3/1: 5 eggs total in nest, 2 whib + 3 anhi 3/8: flag from nest on ground, re-used to mark a different nest" +2023,6th_bridge,302,whib,2023-03-08,,,unknown,"3/1: 5 eggs total in nest, 2 whib + 3 anhi 3/8: flag from nest on ground, re-used to mark a different nest" +2023,6th_bridge,302,whib,2023-03-14,,,,"3/1: 5 eggs total in nest, 2 whib + 3 anhi 3/8: flag from nest on ground, re-used to mark a different nest" +2023,6th_bridge,302,whib,2023-03-21,,,,"3/1: 5 eggs total in nest, 2 whib + 3 anhi 3/8: flag from nest on ground, re-used to mark a different nest" +2023,6th_bridge,302,whib,2023-03-28,,,,"3/1: 5 eggs total in nest, 2 whib + 3 anhi 3/8: flag from nest on ground, re-used to mark a different nest" +2023,6th_bridge,302,whib,2023-04-04,,,,"3/1: 5 eggs total in nest, 2 whib + 3 anhi 3/8: flag from nest on ground, re-used to mark a different nest" +2023,6th_bridge,302,whib,2023-04-15,,,,"3/1: 5 eggs total in nest, 2 whib + 3 anhi 3/8: flag from nest on ground, re-used to mark a different nest" +2023,6th_bridge,302,whib,2023-04-20,,,,"3/1: 5 eggs total in nest, 2 whib + 3 anhi 3/8: flag from nest on ground, re-used to mark a different nest" +2023,6th_bridge,302,whib,2023-04-27,,,,"3/1: 5 eggs total in nest, 2 whib + 3 anhi 3/8: flag from nest on ground, re-used to mark a different nest" +2023,6th_bridge,302,whib,2023-05-03,,,,"3/1: 5 eggs total in nest, 2 whib + 3 anhi 3/8: flag from nest on ground, re-used to mark a different nest" +2023,6th_bridge,302,whib,2023-02-22,,,,"3/8: flag on ground, reused number; 4/4: nest gone" +2023,6th_bridge,302,whib,2023-03-01,,,,"3/8: flag on ground, reused number; 4/4: nest gone" +2023,6th_bridge,302,whib,2023-03-08,2,,incubating,"3/8: flag on ground, reused number; 4/4: nest gone" +2023,6th_bridge,302,whib,2023-03-14,2,,incubating,"3/8: flag on ground, reused number; 4/4: nest gone" +2023,6th_bridge,302,whib,2023-03-21,2,,incubating,"3/8: flag on ground, reused number; 4/4: nest gone" +2023,6th_bridge,302,whib,2023-03-28,,,empty,"3/8: flag on ground, reused number; 4/4: nest gone" +2023,6th_bridge,302,whib,2023-04-04,,,empty,"3/8: flag on ground, reused number; 4/4: nest gone" +2023,6th_bridge,302,whib,2023-04-15,,,empty,"3/8: flag on ground, reused number; 4/4: nest gone" +2023,6th_bridge,302,whib,2023-04-20,,,pulled,"3/8: flag on ground, reused number; 4/4: nest gone" +2023,6th_bridge,302,whib,2023-04-27,,,,"3/8: flag on ground, reused number; 4/4: nest gone" +2023,6th_bridge,302,whib,2023-05-03,,,,"3/8: flag on ground, reused number; 4/4: nest gone" +2023,6th_bridge,236,whib,2023-02-22,,,,"4/4: two chicks total between 236 & 310 4/15: 5 branchlings between 236, 310, 318, & 320" +2023,6th_bridge,236,whib,2023-03-01,2,,incubating,"4/4: two chicks total between 236 & 310 4/15: 5 branchlings between 236, 310, 318, & 320" +2023,6th_bridge,236,whib,2023-03-08,2,,incubating,"4/4: two chicks total between 236 & 310 4/15: 5 branchlings between 236, 310, 318, & 320" +2023,6th_bridge,236,whib,2023-03-14,2,,incubating,"4/4: two chicks total between 236 & 310 4/15: 5 branchlings between 236, 310, 318, & 320" +2023,6th_bridge,236,whib,2023-03-21,,1,nestling,"4/4: two chicks total between 236 & 310 4/15: 5 branchlings between 236, 310, 318, & 320" +2023,6th_bridge,236,whib,2023-03-28,,1,nestling,"4/4: two chicks total between 236 & 310 4/15: 5 branchlings between 236, 310, 318, & 320" +2023,6th_bridge,236,whib,2023-04-04,,1,nestling,"4/4: two chicks total between 236 & 310 4/15: 5 branchlings between 236, 310, 318, & 320" +2023,6th_bridge,236,whib,2023-04-15,,,empty,"4/4: two chicks total between 236 & 310 4/15: 5 branchlings between 236, 310, 318, & 320" +2023,6th_bridge,236,whib,2023-04-20,,,pulled,"4/4: two chicks total between 236 & 310 4/15: 5 branchlings between 236, 310, 318, & 320" +2023,6th_bridge,236,whib,2023-04-27,,,,"4/4: two chicks total between 236 & 310 4/15: 5 branchlings between 236, 310, 318, & 320" +2023,6th_bridge,236,whib,2023-05-03,,,,"4/4: two chicks total between 236 & 310 4/15: 5 branchlings between 236, 310, 318, & 320" +2023,6th_bridge,310,whib,2023-02-22,,,,"4/4: two chicks total between 236 & 310 4/15: 5 branchlings between 236, 310, 318, & 320" +2023,6th_bridge,310,whib,2023-03-01,3,,incubating,"4/4: two chicks total between 236 & 310 4/15: 5 branchlings between 236, 310, 318, & 320" +2023,6th_bridge,310,whib,2023-03-08,3,,incubating,"4/4: two chicks total between 236 & 310 4/15: 5 branchlings between 236, 310, 318, & 320" +2023,6th_bridge,310,whib,2023-03-14,3,,incubating,"4/4: two chicks total between 236 & 310 4/15: 5 branchlings between 236, 310, 318, & 320" +2023,6th_bridge,310,whib,2023-03-21,1,2,hatching,"4/4: two chicks total between 236 & 310 4/15: 5 branchlings between 236, 310, 318, & 320" +2023,6th_bridge,310,whib,2023-03-28,,2,nestling,"4/4: two chicks total between 236 & 310 4/15: 5 branchlings between 236, 310, 318, & 320" +2023,6th_bridge,310,whib,2023-04-04,,1,nestling,"4/4: two chicks total between 236 & 310 4/15: 5 branchlings between 236, 310, 318, & 320" +2023,6th_bridge,310,whib,2023-04-15,,,empty,"4/4: two chicks total between 236 & 310 4/15: 5 branchlings between 236, 310, 318, & 320" +2023,6th_bridge,310,whib,2023-04-20,,,pulled,"4/4: two chicks total between 236 & 310 4/15: 5 branchlings between 236, 310, 318, & 320" +2023,6th_bridge,310,whib,2023-04-27,,,,"4/4: two chicks total between 236 & 310 4/15: 5 branchlings between 236, 310, 318, & 320" +2023,6th_bridge,310,whib,2023-05-03,,,,"4/4: two chicks total between 236 & 310 4/15: 5 branchlings between 236, 310, 318, & 320" +2023,6th_bridge,318,whib,2023-02-22,,,,"4/15: 5 branchlings between 236, 310, 318, & 320" +2023,6th_bridge,318,whib,2023-03-01,2,,incubating,"4/15: 5 branchlings between 236, 310, 318, & 320" +2023,6th_bridge,318,whib,2023-03-08,2,,incubating,"4/15: 5 branchlings between 236, 310, 318, & 320" +2023,6th_bridge,318,whib,2023-03-14,2,,incubating,"4/15: 5 branchlings between 236, 310, 318, & 320" +2023,6th_bridge,318,whib,2023-03-21,,1,nestling,"4/15: 5 branchlings between 236, 310, 318, & 320" +2023,6th_bridge,318,whib,2023-03-28,,,empty,"4/15: 5 branchlings between 236, 310, 318, & 320" +2023,6th_bridge,318,whib,2023-04-04,,,empty,"4/15: 5 branchlings between 236, 310, 318, & 320" +2023,6th_bridge,318,whib,2023-04-15,,,empty,"4/15: 5 branchlings between 236, 310, 318, & 320" +2023,6th_bridge,318,whib,2023-04-20,,,pulled,"4/15: 5 branchlings between 236, 310, 318, & 320" +2023,6th_bridge,318,whib,2023-04-27,,,,"4/15: 5 branchlings between 236, 310, 318, & 320" +2023,6th_bridge,318,whib,2023-05-03,,,,"4/15: 5 branchlings between 236, 310, 318, & 320" +2023,6th_bridge,320,whib,2023-02-22,,,,"4/15: 5 branchlings between 236, 310, 318, & 320" +2023,6th_bridge,320,whib,2023-03-01,3,,incubating,"4/15: 5 branchlings between 236, 310, 318, & 320" +2023,6th_bridge,320,whib,2023-03-08,3,,incubating,"4/15: 5 branchlings between 236, 310, 318, & 320" +2023,6th_bridge,320,whib,2023-03-14,3,,incubating,"4/15: 5 branchlings between 236, 310, 318, & 320" +2023,6th_bridge,320,whib,2023-03-21,,2,nestling,"4/15: 5 branchlings between 236, 310, 318, & 320" +2023,6th_bridge,320,whib,2023-03-28,,2,nestling,"4/15: 5 branchlings between 236, 310, 318, & 320" +2023,6th_bridge,320,whib,2023-04-04,,2,nestling,"4/15: 5 branchlings between 236, 310, 318, & 320" +2023,6th_bridge,320,whib,2023-04-15,,,empty,"4/15: 5 branchlings between 236, 310, 318, & 320" +2023,6th_bridge,320,whib,2023-04-20,,,pulled,"4/15: 5 branchlings between 236, 310, 318, & 320" +2023,6th_bridge,320,whib,2023-04-27,,,,"4/15: 5 branchlings between 236, 310, 318, & 320" +2023,6th_bridge,320,whib,2023-05-03,,,,"4/15: 5 branchlings between 236, 310, 318, & 320" +2023,6th_bridge,304,whib,2023-02-22,,,,"4/15: 3 branchlings above 304, 306, 363, 365, & 367" +2023,6th_bridge,304,whib,2023-03-01,1,,incubating,"4/15: 3 branchlings above 304, 306, 363, 365, & 367" +2023,6th_bridge,304,whib,2023-03-08,1,,incubating,"4/15: 3 branchlings above 304, 306, 363, 365, & 367" +2023,6th_bridge,304,whib,2023-03-14,1,,incubating,"4/15: 3 branchlings above 304, 306, 363, 365, & 367" +2023,6th_bridge,304,whib,2023-03-21,,1,nestling,"4/15: 3 branchlings above 304, 306, 363, 365, & 367" +2023,6th_bridge,304,whib,2023-03-28,,1,nestling,"4/15: 3 branchlings above 304, 306, 363, 365, & 367" +2023,6th_bridge,304,whib,2023-04-04,,1,nestling,"4/15: 3 branchlings above 304, 306, 363, 365, & 367" +2023,6th_bridge,304,whib,2023-04-15,,,empty,"4/15: 3 branchlings above 304, 306, 363, 365, & 367" +2023,6th_bridge,304,whib,2023-04-20,,,pulled,"4/15: 3 branchlings above 304, 306, 363, 365, & 367" +2023,6th_bridge,304,whib,2023-04-27,,,,"4/15: 3 branchlings above 304, 306, 363, 365, & 367" +2023,6th_bridge,304,whib,2023-05-03,,,,"4/15: 3 branchlings above 304, 306, 363, 365, & 367" +2023,6th_bridge,306,whib,2023-02-22,,,,"4/15: 3 branchlings above 304, 306, 363, 365, & 367" +2023,6th_bridge,306,whib,2023-03-01,3,,incubating,"4/15: 3 branchlings above 304, 306, 363, 365, & 367" +2023,6th_bridge,306,whib,2023-03-08,3,,incubating,"4/15: 3 branchlings above 304, 306, 363, 365, & 367" +2023,6th_bridge,306,whib,2023-03-14,3,,incubating,"4/15: 3 branchlings above 304, 306, 363, 365, & 367" +2023,6th_bridge,306,whib,2023-03-21,,2,nestling,"4/15: 3 branchlings above 304, 306, 363, 365, & 367" +2023,6th_bridge,306,whib,2023-03-28,,,empty,"4/15: 3 branchlings above 304, 306, 363, 365, & 367" +2023,6th_bridge,306,whib,2023-04-04,,,empty,"4/15: 3 branchlings above 304, 306, 363, 365, & 367" +2023,6th_bridge,306,whib,2023-04-15,,,empty,"4/15: 3 branchlings above 304, 306, 363, 365, & 367" +2023,6th_bridge,306,whib,2023-04-20,,,pulled,"4/15: 3 branchlings above 304, 306, 363, 365, & 367" +2023,6th_bridge,306,whib,2023-04-27,,,,"4/15: 3 branchlings above 304, 306, 363, 365, & 367" +2023,6th_bridge,306,whib,2023-05-03,,,,"4/15: 3 branchlings above 304, 306, 363, 365, & 367" +2023,6th_bridge,363,whib,2023-02-22,,,,"4/15: 3 branchlings above 304, 306, 363, 365, & 367" +2023,6th_bridge,363,whib,2023-03-01,,,,"4/15: 3 branchlings above 304, 306, 363, 365, & 367" +2023,6th_bridge,363,whib,2023-03-08,3,,incubating,"4/15: 3 branchlings above 304, 306, 363, 365, & 367" +2023,6th_bridge,363,whib,2023-03-14,3,,incubating,"4/15: 3 branchlings above 304, 306, 363, 365, & 367" +2023,6th_bridge,363,whib,2023-03-21,3,,incubating,"4/15: 3 branchlings above 304, 306, 363, 365, & 367" +2023,6th_bridge,363,whib,2023-03-28,,3,nestling,"4/15: 3 branchlings above 304, 306, 363, 365, & 367" +2023,6th_bridge,363,whib,2023-04-04,,2,nestling,"4/15: 3 branchlings above 304, 306, 363, 365, & 367" +2023,6th_bridge,363,whib,2023-04-15,,,empty,"4/15: 3 branchlings above 304, 306, 363, 365, & 367" +2023,6th_bridge,363,whib,2023-04-20,,,pulled,"4/15: 3 branchlings above 304, 306, 363, 365, & 367" +2023,6th_bridge,363,whib,2023-04-27,,,,"4/15: 3 branchlings above 304, 306, 363, 365, & 367" +2023,6th_bridge,363,whib,2023-05-03,,,,"4/15: 3 branchlings above 304, 306, 363, 365, & 367" +2023,6th_bridge,365,whib,2023-02-22,,,,"4/4: 3 chicks certain 4/15: 3 branchlings above 304, 306, 363, 365, & 367" +2023,6th_bridge,365,whib,2023-03-01,,,,"4/4: 3 chicks certain 4/15: 3 branchlings above 304, 306, 363, 365, & 367" +2023,6th_bridge,365,whib,2023-03-08,3,,incubating,"4/4: 3 chicks certain 4/15: 3 branchlings above 304, 306, 363, 365, & 367" +2023,6th_bridge,365,whib,2023-03-14,3,,incubating,"4/4: 3 chicks certain 4/15: 3 branchlings above 304, 306, 363, 365, & 367" +2023,6th_bridge,365,whib,2023-03-21,3,,incubating,"4/4: 3 chicks certain 4/15: 3 branchlings above 304, 306, 363, 365, & 367" +2023,6th_bridge,365,whib,2023-03-28,1,2,hatching,"4/4: 3 chicks certain 4/15: 3 branchlings above 304, 306, 363, 365, & 367" +2023,6th_bridge,365,whib,2023-04-04,,3,nestling,"4/4: 3 chicks certain 4/15: 3 branchlings above 304, 306, 363, 365, & 367" +2023,6th_bridge,365,whib,2023-04-15,,,empty,"4/4: 3 chicks certain 4/15: 3 branchlings above 304, 306, 363, 365, & 367" +2023,6th_bridge,365,whib,2023-04-20,,,pulled,"4/4: 3 chicks certain 4/15: 3 branchlings above 304, 306, 363, 365, & 367" +2023,6th_bridge,365,whib,2023-04-27,,,,"4/4: 3 chicks certain 4/15: 3 branchlings above 304, 306, 363, 365, & 367" +2023,6th_bridge,365,whib,2023-05-03,,,,"4/4: 3 chicks certain 4/15: 3 branchlings above 304, 306, 363, 365, & 367" +2023,6th_bridge,367,whib,2023-02-22,,,,"3/28: certain of nest contents; 4/4: 1 chick certain 4/15: 3 branchlings above 304, 306, 363, 365, & 367" +2023,6th_bridge,367,whib,2023-03-01,,,,"3/28: certain of nest contents; 4/4: 1 chick certain 4/15: 3 branchlings above 304, 306, 363, 365, & 367" +2023,6th_bridge,367,whib,2023-03-08,3,,incubating,"3/28: certain of nest contents; 4/4: 1 chick certain 4/15: 3 branchlings above 304, 306, 363, 365, & 367" +2023,6th_bridge,367,whib,2023-03-14,3,,incubating,"3/28: certain of nest contents; 4/4: 1 chick certain 4/15: 3 branchlings above 304, 306, 363, 365, & 367" +2023,6th_bridge,367,whib,2023-03-21,3,,incubating,"3/28: certain of nest contents; 4/4: 1 chick certain 4/15: 3 branchlings above 304, 306, 363, 365, & 367" +2023,6th_bridge,367,whib,2023-03-28,2,2,hatching,"3/28: certain of nest contents; 4/4: 1 chick certain 4/15: 3 branchlings above 304, 306, 363, 365, & 367" +2023,6th_bridge,367,whib,2023-04-04,,1,nestling,"3/28: certain of nest contents; 4/4: 1 chick certain 4/15: 3 branchlings above 304, 306, 363, 365, & 367" +2023,6th_bridge,367,whib,2023-04-15,,,empty,"3/28: certain of nest contents; 4/4: 1 chick certain 4/15: 3 branchlings above 304, 306, 363, 365, & 367" +2023,6th_bridge,367,whib,2023-04-20,,,pulled,"3/28: certain of nest contents; 4/4: 1 chick certain 4/15: 3 branchlings above 304, 306, 363, 365, & 367" +2023,6th_bridge,367,whib,2023-04-27,,,,"3/28: certain of nest contents; 4/4: 1 chick certain 4/15: 3 branchlings above 304, 306, 363, 365, & 367" +2023,6th_bridge,367,whib,2023-05-03,,,,"3/28: certain of nest contents; 4/4: 1 chick certain 4/15: 3 branchlings above 304, 306, 363, 365, & 367" +2023,6th_bridge,369,whib,2023-02-22,,,,"4/4: 1 chick certain" +2023,6th_bridge,369,whib,2023-03-01,,,,"4/4: 1 chick certain" +2023,6th_bridge,369,whib,2023-03-08,3,,incubating,"4/4: 1 chick certain" +2023,6th_bridge,369,whib,2023-03-14,3,,incubating,"4/4: 1 chick certain" +2023,6th_bridge,369,whib,2023-03-21,2,1,hatching,"4/4: 1 chick certain" +2023,6th_bridge,369,whib,2023-03-28,,1,nestling,"4/4: 1 chick certain" +2023,6th_bridge,369,whib,2023-04-04,,1,nestling,"4/4: 1 chick certain" +2023,6th_bridge,369,whib,2023-04-15,,,empty,"4/4: 1 chick certain" +2023,6th_bridge,369,whib,2023-04-20,,,pulled,"4/4: 1 chick certain" +2023,6th_bridge,369,whib,2023-04-27,,,,"4/4: 1 chick certain" +2023,6th_bridge,369,whib,2023-05-03,,,,"4/4: 1 chick certain" +2023,6th_bridge,445,whib,2023-02-22,,,, +2023,6th_bridge,445,whib,2023-03-01,,,, +2023,6th_bridge,445,whib,2023-03-08,,,, +2023,6th_bridge,445,whib,2023-03-14,3,,incubating, +2023,6th_bridge,445,whib,2023-03-21,3,,incubating, +2023,6th_bridge,445,whib,2023-03-28,,3,nestling, +2023,6th_bridge,445,whib,2023-04-04,,,missed, +2023,6th_bridge,445,whib,2023-04-15,,,missed, +2023,6th_bridge,445,whib,2023-04-20,,,missed, +2023,6th_bridge,445,whib,2023-04-27,,,empty, +2023,6th_bridge,445,whib,2023-05-03,,,, +2023,6th_bridge,371,whib,2023-02-22,,,,"4/4: 2+ chicks" +2023,6th_bridge,371,whib,2023-03-01,,,,"4/4: 2+ chicks" +2023,6th_bridge,371,whib,2023-03-08,3,,incubating,"4/4: 2+ chicks" +2023,6th_bridge,371,whib,2023-03-14,3,,incubating,"4/4: 2+ chicks" +2023,6th_bridge,371,whib,2023-03-21,,3,nestling,"4/4: 2+ chicks" +2023,6th_bridge,371,whib,2023-03-28,,3,nestling,"4/4: 2+ chicks" +2023,6th_bridge,371,whib,2023-04-04,,2,nestling,"4/4: 2+ chicks" +2023,6th_bridge,371,whib,2023-04-15,,,empty,"4/4: 2+ chicks" +2023,6th_bridge,371,whib,2023-04-20,,,pulled,"4/4: 2+ chicks" +2023,6th_bridge,371,whib,2023-04-27,,,,"4/4: 2+ chicks" +2023,6th_bridge,371,whib,2023-05-03,,,,"4/4: 2+ chicks" +2023,6th_bridge,373,whib,2023-02-22,,,, +2023,6th_bridge,373,whib,2023-03-01,,,, +2023,6th_bridge,373,whib,2023-03-08,1,,incubating, +2023,6th_bridge,373,whib,2023-03-14,1,,incubating, +2023,6th_bridge,373,whib,2023-03-21,,,empty, +2023,6th_bridge,373,whib,2023-03-28,,,empty, +2023,6th_bridge,373,whib,2023-04-04,,,empty, +2023,6th_bridge,373,whib,2023-04-15,,,empty, +2023,6th_bridge,373,whib,2023-04-20,,,pulled, +2023,6th_bridge,373,whib,2023-04-27,,,, +2023,6th_bridge,373,whib,2023-05-03,,,, +2023,6th_bridge,375,whib,2023-02-22,,,,"4/4: Two dead chicks on ground under nest cluster 4/15: chick big 4/20: flag pulled, some fledgers flew off" +2023,6th_bridge,375,whib,2023-03-01,,,,"4/4: Two dead chicks on ground under nest cluster 4/15: chick big 4/20: flag pulled, some fledgers flew off" +2023,6th_bridge,375,whib,2023-03-08,2,,incubating,"4/4: Two dead chicks on ground under nest cluster 4/15: chick big 4/20: flag pulled, some fledgers flew off" +2023,6th_bridge,375,whib,2023-03-14,2,,incubating,"4/4: Two dead chicks on ground under nest cluster 4/15: chick big 4/20: flag pulled, some fledgers flew off" +2023,6th_bridge,375,whib,2023-03-21,2,,incubating,"4/4: Two dead chicks on ground under nest cluster 4/15: chick big 4/20: flag pulled, some fledgers flew off" +2023,6th_bridge,375,whib,2023-03-28,,2,nestling,"4/4: Two dead chicks on ground under nest cluster 4/15: chick big 4/20: flag pulled, some fledgers flew off" +2023,6th_bridge,375,whib,2023-04-04,,1,nestling,"4/4: Two dead chicks on ground under nest cluster 4/15: chick big 4/20: flag pulled, some fledgers flew off" +2023,6th_bridge,375,whib,2023-04-15,,1,nestling,"4/4: Two dead chicks on ground under nest cluster 4/15: chick big 4/20: flag pulled, some fledgers flew off" +2023,6th_bridge,375,whib,2023-04-20,,,empty,"4/4: Two dead chicks on ground under nest cluster 4/15: chick big 4/20: flag pulled, some fledgers flew off" +2023,6th_bridge,375,whib,2023-04-27,,,,"4/4: Two dead chicks on ground under nest cluster 4/15: chick big 4/20: flag pulled, some fledgers flew off" +2023,6th_bridge,375,whib,2023-05-03,,,,"4/4: Two dead chicks on ground under nest cluster 4/15: chick big 4/20: flag pulled, some fledgers flew off" +2023,6th_bridge,377,whib,2023-02-22,,,,"4/4: Two dead chicks on ground under nest cluster 4/15: chick big 4/20: flag pulled, some fledgers flew off" +2023,6th_bridge,377,whib,2023-03-01,,,,"4/4: Two dead chicks on ground under nest cluster 4/15: chick big 4/20: flag pulled, some fledgers flew off" +2023,6th_bridge,377,whib,2023-03-08,2,,incubating,"4/4: Two dead chicks on ground under nest cluster 4/15: chick big 4/20: flag pulled, some fledgers flew off" +2023,6th_bridge,377,whib,2023-03-14,2,,incubating,"4/4: Two dead chicks on ground under nest cluster 4/15: chick big 4/20: flag pulled, some fledgers flew off" +2023,6th_bridge,377,whib,2023-03-21,2,,incubating,"4/4: Two dead chicks on ground under nest cluster 4/15: chick big 4/20: flag pulled, some fledgers flew off" +2023,6th_bridge,377,whib,2023-03-28,,2,nestling,"4/4: Two dead chicks on ground under nest cluster 4/15: chick big 4/20: flag pulled, some fledgers flew off" +2023,6th_bridge,377,whib,2023-04-04,,1,nestling,"4/4: Two dead chicks on ground under nest cluster 4/15: chick big 4/20: flag pulled, some fledgers flew off" +2023,6th_bridge,377,whib,2023-04-15,,1,nestling,"4/4: Two dead chicks on ground under nest cluster 4/15: chick big 4/20: flag pulled, some fledgers flew off" +2023,6th_bridge,377,whib,2023-04-20,,,empty,"4/4: Two dead chicks on ground under nest cluster 4/15: chick big 4/20: flag pulled, some fledgers flew off" +2023,6th_bridge,377,whib,2023-04-27,,,,"4/4: Two dead chicks on ground under nest cluster 4/15: chick big 4/20: flag pulled, some fledgers flew off" +2023,6th_bridge,377,whib,2023-05-03,,,,"4/4: Two dead chicks on ground under nest cluster 4/15: chick big 4/20: flag pulled, some fledgers flew off" +2023,6th_bridge,379,whib,2023-02-22,,,,"4/4: Two dead chicks on ground under nest cluster. Certain of 1 chick. 4/15: chick big 4/20: flag pulled, some fledgers flew off" +2023,6th_bridge,379,whib,2023-03-01,,,,"4/4: Two dead chicks on ground under nest cluster. Certain of 1 chick. 4/15: chick big 4/20: flag pulled, some fledgers flew off" +2023,6th_bridge,379,whib,2023-03-08,2,,incubating,"4/4: Two dead chicks on ground under nest cluster. Certain of 1 chick. 4/15: chick big 4/20: flag pulled, some fledgers flew off" +2023,6th_bridge,379,whib,2023-03-14,2,,incubating,"4/4: Two dead chicks on ground under nest cluster. Certain of 1 chick. 4/15: chick big 4/20: flag pulled, some fledgers flew off" +2023,6th_bridge,379,whib,2023-03-21,2,,incubating,"4/4: Two dead chicks on ground under nest cluster. Certain of 1 chick. 4/15: chick big 4/20: flag pulled, some fledgers flew off" +2023,6th_bridge,379,whib,2023-03-28,,2,nestling,"4/4: Two dead chicks on ground under nest cluster. Certain of 1 chick. 4/15: chick big 4/20: flag pulled, some fledgers flew off" +2023,6th_bridge,379,whib,2023-04-04,,1,nestling,"4/4: Two dead chicks on ground under nest cluster. Certain of 1 chick. 4/15: chick big 4/20: flag pulled, some fledgers flew off" +2023,6th_bridge,379,whib,2023-04-15,,1,nestling,"4/4: Two dead chicks on ground under nest cluster. Certain of 1 chick. 4/15: chick big 4/20: flag pulled, some fledgers flew off" +2023,6th_bridge,379,whib,2023-04-20,,,empty,"4/4: Two dead chicks on ground under nest cluster. Certain of 1 chick. 4/15: chick big 4/20: flag pulled, some fledgers flew off" +2023,6th_bridge,379,whib,2023-04-27,,,,"4/4: Two dead chicks on ground under nest cluster. Certain of 1 chick. 4/15: chick big 4/20: flag pulled, some fledgers flew off" +2023,6th_bridge,379,whib,2023-05-03,,,,"4/4: Two dead chicks on ground under nest cluster. Certain of 1 chick. 4/15: chick big 4/20: flag pulled, some fledgers flew off" +2023,6th_bridge,381,whib,2023-02-22,,,,"3/8: highest nest, above another; 4/4: Two dead chicks on ground under nest cluster 4/15: chick big 4/20: flag pulled, some fledgers flew off" +2023,6th_bridge,381,whib,2023-03-01,,,,"3/8: highest nest, above another; 4/4: Two dead chicks on ground under nest cluster 4/15: chick big 4/20: flag pulled, some fledgers flew off" +2023,6th_bridge,381,whib,2023-03-08,2,,incubating,"3/8: highest nest, above another; 4/4: Two dead chicks on ground under nest cluster 4/15: chick big 4/20: flag pulled, some fledgers flew off" +2023,6th_bridge,381,whib,2023-03-14,2,,incubating,"3/8: highest nest, above another; 4/4: Two dead chicks on ground under nest cluster 4/15: chick big 4/20: flag pulled, some fledgers flew off" +2023,6th_bridge,381,whib,2023-03-21,2,,incubating,"3/8: highest nest, above another; 4/4: Two dead chicks on ground under nest cluster 4/15: chick big 4/20: flag pulled, some fledgers flew off" +2023,6th_bridge,381,whib,2023-03-28,,2,nestling,"3/8: highest nest, above another; 4/4: Two dead chicks on ground under nest cluster 4/15: chick big 4/20: flag pulled, some fledgers flew off" +2023,6th_bridge,381,whib,2023-04-04,,1,nestling,"3/8: highest nest, above another; 4/4: Two dead chicks on ground under nest cluster 4/15: chick big 4/20: flag pulled, some fledgers flew off" +2023,6th_bridge,381,whib,2023-04-15,,1,nestling,"3/8: highest nest, above another; 4/4: Two dead chicks on ground under nest cluster 4/15: chick big 4/20: flag pulled, some fledgers flew off" +2023,6th_bridge,381,whib,2023-04-20,,,empty,"3/8: highest nest, above another; 4/4: Two dead chicks on ground under nest cluster 4/15: chick big 4/20: flag pulled, some fledgers flew off" +2023,6th_bridge,381,whib,2023-04-27,,,,"3/8: highest nest, above another; 4/4: Two dead chicks on ground under nest cluster 4/15: chick big 4/20: flag pulled, some fledgers flew off" +2023,6th_bridge,381,whib,2023-05-03,,,,"3/8: highest nest, above another; 4/4: Two dead chicks on ground under nest cluster 4/15: chick big 4/20: flag pulled, some fledgers flew off" +2023,6th_bridge,383,whib,2023-02-22,,,,"4/4: one additional chick in nest. Two dead chicks on ground under nest cluster 4/15: chick big 4/20: flag pulled, some fledgers flew off" +2023,6th_bridge,383,whib,2023-03-01,,,,"4/4: one additional chick in nest. Two dead chicks on ground under nest cluster 4/15: chick big 4/20: flag pulled, some fledgers flew off" +2023,6th_bridge,383,whib,2023-03-08,2,,incubating,"4/4: one additional chick in nest. Two dead chicks on ground under nest cluster 4/15: chick big 4/20: flag pulled, some fledgers flew off" +2023,6th_bridge,383,whib,2023-03-14,2,,incubating,"4/4: one additional chick in nest. Two dead chicks on ground under nest cluster 4/15: chick big 4/20: flag pulled, some fledgers flew off" +2023,6th_bridge,383,whib,2023-03-21,2,,incubating,"4/4: one additional chick in nest. Two dead chicks on ground under nest cluster 4/15: chick big 4/20: flag pulled, some fledgers flew off" +2023,6th_bridge,383,whib,2023-03-28,,2,nestling,"4/4: one additional chick in nest. Two dead chicks on ground under nest cluster 4/15: chick big 4/20: flag pulled, some fledgers flew off" +2023,6th_bridge,383,whib,2023-04-04,,3,nestling,"4/4: one additional chick in nest. Two dead chicks on ground under nest cluster 4/15: chick big 4/20: flag pulled, some fledgers flew off" +2023,6th_bridge,383,whib,2023-04-15,,1,nestling,"4/4: one additional chick in nest. Two dead chicks on ground under nest cluster 4/15: chick big 4/20: flag pulled, some fledgers flew off" +2023,6th_bridge,383,whib,2023-04-20,,,empty,"4/4: one additional chick in nest. Two dead chicks on ground under nest cluster 4/15: chick big 4/20: flag pulled, some fledgers flew off" +2023,6th_bridge,383,whib,2023-04-27,,,,"4/4: one additional chick in nest. Two dead chicks on ground under nest cluster 4/15: chick big 4/20: flag pulled, some fledgers flew off" +2023,6th_bridge,383,whib,2023-05-03,,,,"4/4: one additional chick in nest. Two dead chicks on ground under nest cluster 4/15: chick big 4/20: flag pulled, some fledgers flew off" +2023,6th_bridge,447,trhe,2023-02-22,,,,"5/3: 1+ chick at top of trees" +2023,6th_bridge,447,trhe,2023-03-01,,,,"5/3: 1+ chick at top of trees" +2023,6th_bridge,447,trhe,2023-03-08,,,,"5/3: 1+ chick at top of trees" +2023,6th_bridge,447,trhe,2023-03-14,3,,incubating,"5/3: 1+ chick at top of trees" +2023,6th_bridge,447,trhe,2023-03-21,3,,incubating,"5/3: 1+ chick at top of trees" +2023,6th_bridge,447,trhe,2023-03-28,3,,incubating,"5/3: 1+ chick at top of trees" +2023,6th_bridge,447,trhe,2023-04-04,1,2,chick_dry,"5/3: 1+ chick at top of trees" +2023,6th_bridge,447,trhe,2023-04-15,,2,nestling,"5/3: 1+ chick at top of trees" +2023,6th_bridge,447,trhe,2023-04-20,,2,nestling,"5/3: 1+ chick at top of trees" +2023,6th_bridge,447,trhe,2023-04-27,,2,branchling,"5/3: 1+ chick at top of trees" +2023,6th_bridge,447,trhe,2023-05-03,,1,branchling,"5/3: 1+ chick at top of trees" +2023,6th_bridge,385,smwh,2023-02-22,,,,"4/15: 2 branchlings, could be from another nest 4/20: flag pulled" +2023,6th_bridge,385,smwh,2023-03-01,,,,"4/15: 2 branchlings, could be from another nest 4/20: flag pulled" +2023,6th_bridge,385,smwh,2023-03-08,3,,incubating,"4/15: 2 branchlings, could be from another nest 4/20: flag pulled" +2023,6th_bridge,385,smwh,2023-03-14,3,,incubating,"4/15: 2 branchlings, could be from another nest 4/20: flag pulled" +2023,6th_bridge,385,smwh,2023-03-21,3,,incubating,"4/15: 2 branchlings, could be from another nest 4/20: flag pulled" +2023,6th_bridge,385,smwh,2023-03-28,,3,nestling,"4/15: 2 branchlings, could be from another nest 4/20: flag pulled" +2023,6th_bridge,385,smwh,2023-04-04,,2,nestling,"4/15: 2 branchlings, could be from another nest 4/20: flag pulled" +2023,6th_bridge,385,smwh,2023-04-15,,2,branchling,"4/15: 2 branchlings, could be from another nest 4/20: flag pulled" +2023,6th_bridge,385,smwh,2023-04-20,,,empty,"4/15: 2 branchlings, could be from another nest 4/20: flag pulled" +2023,6th_bridge,385,smwh,2023-04-27,,,,"4/15: 2 branchlings, could be from another nest 4/20: flag pulled" +2023,6th_bridge,385,smwh,2023-05-03,,,,"4/15: 2 branchlings, could be from another nest 4/20: flag pulled" +2023,6th_bridge,387,sneg,2023-02-22,,,,"3/8: very small eggs 4/15: 1 dead chick" +2023,6th_bridge,387,sneg,2023-03-01,,,,"3/8: very small eggs 4/15: 1 dead chick" +2023,6th_bridge,387,sneg,2023-03-08,3,,incubating,"3/8: very small eggs 4/15: 1 dead chick" +2023,6th_bridge,387,sneg,2023-03-14,3,,incubating,"3/8: very small eggs 4/15: 1 dead chick" +2023,6th_bridge,387,sneg,2023-03-21,3,,incubating,"3/8: very small eggs 4/15: 1 dead chick" +2023,6th_bridge,387,sneg,2023-03-28,,3,nestling,"3/8: very small eggs 4/15: 1 dead chick" +2023,6th_bridge,387,sneg,2023-04-04,,,missed,"3/8: very small eggs 4/15: 1 dead chick" +2023,6th_bridge,387,sneg,2023-04-15,,,empty,"3/8: very small eggs 4/15: 1 dead chick" +2023,6th_bridge,387,sneg,2023-04-20,,,empty,"3/8: very small eggs 4/15: 1 dead chick" +2023,6th_bridge,387,sneg,2023-04-27,,,missed,"3/8: very small eggs 4/15: 1 dead chick" +2023,6th_bridge,387,sneg,2023-05-03,,,missed,"3/8: very small eggs 4/15: 1 dead chick" +2023,6th_bridge,389,whib,2023-02-22,,,, +2023,6th_bridge,389,whib,2023-03-01,,,, +2023,6th_bridge,389,whib,2023-03-08,2,,incubating, +2023,6th_bridge,389,whib,2023-03-14,2,,incubating, +2023,6th_bridge,389,whib,2023-03-21,,2,nestling, +2023,6th_bridge,389,whib,2023-03-28,,2,nestling, +2023,6th_bridge,389,whib,2023-04-04,,2,nestling, +2023,6th_bridge,389,whib,2023-04-15,,,missed, +2023,6th_bridge,389,whib,2023-04-20,,,missed, +2023,6th_bridge,389,whib,2023-04-27,,,empty, +2023,6th_bridge,389,whib,2023-05-03,,,, +2023,6th_bridge,395,greg,2023-02-22,,,,"3/8: one chick hatched today 4/20: chicks ran away; 4/27: 2 branchlings flew away" +2023,6th_bridge,395,greg,2023-03-01,,,,"3/8: one chick hatched today 4/20: chicks ran away; 4/27: 2 branchlings flew away" +2023,6th_bridge,395,greg,2023-03-08,,2,wet_chick,"3/8: one chick hatched today 4/20: chicks ran away; 4/27: 2 branchlings flew away" +2023,6th_bridge,395,greg,2023-03-14,,2,nestling,"3/8: one chick hatched today 4/20: chicks ran away; 4/27: 2 branchlings flew away" +2023,6th_bridge,395,greg,2023-03-21,,2,nestling,"3/8: one chick hatched today 4/20: chicks ran away; 4/27: 2 branchlings flew away" +2023,6th_bridge,395,greg,2023-03-28,,2,nestling,"3/8: one chick hatched today 4/20: chicks ran away; 4/27: 2 branchlings flew away" +2023,6th_bridge,395,greg,2023-04-04,,2,nestling,"3/8: one chick hatched today 4/20: chicks ran away; 4/27: 2 branchlings flew away" +2023,6th_bridge,395,greg,2023-04-15,,2,nestling,"3/8: one chick hatched today 4/20: chicks ran away; 4/27: 2 branchlings flew away" +2023,6th_bridge,395,greg,2023-04-20,,2,nestling,"3/8: one chick hatched today 4/20: chicks ran away; 4/27: 2 branchlings flew away" +2023,6th_bridge,395,greg,2023-04-27,,2,branchling,"3/8: one chick hatched today 4/20: chicks ran away; 4/27: 2 branchlings flew away" +2023,6th_bridge,395,greg,2023-05-03,,,,"3/8: one chick hatched today 4/20: chicks ran away; 4/27: 2 branchlings flew away" +2023,6th_bridge,391,whib,2023-02-22,,,,"3/21: egg pipping" +2023,6th_bridge,391,whib,2023-03-01,,,,"3/21: egg pipping" +2023,6th_bridge,391,whib,2023-03-08,2,,incubating,"3/21: egg pipping" +2023,6th_bridge,391,whib,2023-03-14,2,,incubating,"3/21: egg pipping" +2023,6th_bridge,391,whib,2023-03-21,1,1,pipping,"3/21: egg pipping" +2023,6th_bridge,391,whib,2023-03-28,,1,nestling,"3/21: egg pipping" +2023,6th_bridge,391,whib,2023-04-04,,1,nestling,"3/21: egg pipping" +2023,6th_bridge,391,whib,2023-04-15,,,empty,"3/21: egg pipping" +2023,6th_bridge,391,whib,2023-04-20,,,pulled,"3/21: egg pipping" +2023,6th_bridge,391,whib,2023-04-27,,,,"3/21: egg pipping" +2023,6th_bridge,391,whib,2023-05-03,,,,"3/21: egg pipping" +2023,6th_bridge,393,whib,2023-02-22,,,,"4/20: flag pulled" +2023,6th_bridge,393,whib,2023-03-01,,,,"4/20: flag pulled" +2023,6th_bridge,393,whib,2023-03-08,3,,incubating,"4/20: flag pulled" +2023,6th_bridge,393,whib,2023-03-14,3,,incubating,"4/20: flag pulled" +2023,6th_bridge,393,whib,2023-03-21,1,2,hatching,"4/20: flag pulled" +2023,6th_bridge,393,whib,2023-03-28,,1,nestling,"4/20: flag pulled" +2023,6th_bridge,393,whib,2023-04-04,,1,nestling,"4/20: flag pulled" +2023,6th_bridge,393,whib,2023-04-15,,1,nestling,"4/20: flag pulled" +2023,6th_bridge,393,whib,2023-04-20,,,empty,"4/20: flag pulled" +2023,6th_bridge,393,whib,2023-04-27,,,,"4/20: flag pulled" +2023,6th_bridge,393,whib,2023-05-03,,,,"4/20: flag pulled" +2023,6th_bridge,330,whib,2023-02-22,,,, +2023,6th_bridge,330,whib,2023-03-01,,,, +2023,6th_bridge,330,whib,2023-03-08,,,, +2023,6th_bridge,330,whib,2023-03-14,,,, +2023,6th_bridge,330,whib,2023-03-21,1,,incubating, +2023,6th_bridge,330,whib,2023-03-28,1,,incubating, +2023,6th_bridge,330,whib,2023-04-04,2,,incubating, +2023,6th_bridge,330,whib,2023-04-15,,,missed, +2023,6th_bridge,330,whib,2023-04-20,,,missed, +2023,6th_bridge,330,whib,2023-04-27,,,missed, +2023,6th_bridge,330,whib,2023-05-03,,,missed, +2023,6th_bridge,397,whib,2023-02-22,,,,"4/15: nest gone" +2023,6th_bridge,397,whib,2023-03-01,,,,"4/15: nest gone" +2023,6th_bridge,397,whib,2023-03-08,2,,incubating,"4/15: nest gone" +2023,6th_bridge,397,whib,2023-03-14,2,,incubating,"4/15: nest gone" +2023,6th_bridge,397,whib,2023-03-21,,2,nestling,"4/15: nest gone" +2023,6th_bridge,397,whib,2023-03-28,,2,nestling,"4/15: nest gone" +2023,6th_bridge,397,whib,2023-04-04,,2,nestling,"4/15: nest gone" +2023,6th_bridge,397,whib,2023-04-15,,,empty,"4/15: nest gone" +2023,6th_bridge,397,whib,2023-04-20,,,empty,"4/15: nest gone" +2023,6th_bridge,397,whib,2023-04-27,,,missed,"4/15: nest gone" +2023,6th_bridge,397,whib,2023-05-03,,,,"4/15: nest gone" +2023,6th_bridge,399,whib,2023-02-22,,,, +2023,6th_bridge,399,whib,2023-03-01,,,, +2023,6th_bridge,399,whib,2023-03-08,3,,incubating, +2023,6th_bridge,399,whib,2023-03-14,2,,incubating, +2023,6th_bridge,399,whib,2023-03-21,,,empty, +2023,6th_bridge,399,whib,2023-03-28,,,empty, +2023,6th_bridge,399,whib,2023-04-04,,,missed, +2023,6th_bridge,399,whib,2023-04-15,,,empty, +2023,6th_bridge,399,whib,2023-04-20,,,empty, +2023,6th_bridge,399,whib,2023-04-27,,,missed, +2023,6th_bridge,399,whib,2023-05-03,,,, +2023,6th_bridge,401,smwh,2023-02-22,,,,"3/14: small eggs; 4/4: two live chicks & one dead chick 4/20: large dead SMWH in nest, likely not from 401" +2023,6th_bridge,401,smwh,2023-03-01,,,,"3/14: small eggs; 4/4: two live chicks & one dead chick 4/20: large dead SMWH in nest, likely not from 401" +2023,6th_bridge,401,smwh,2023-03-08,4,,incubating,"3/14: small eggs; 4/4: two live chicks & one dead chick 4/20: large dead SMWH in nest, likely not from 401" +2023,6th_bridge,401,smwh,2023-03-14,4,,incubating,"3/14: small eggs; 4/4: two live chicks & one dead chick 4/20: large dead SMWH in nest, likely not from 401" +2023,6th_bridge,401,smwh,2023-03-21,4,,incubating,"3/14: small eggs; 4/4: two live chicks & one dead chick 4/20: large dead SMWH in nest, likely not from 401" +2023,6th_bridge,401,smwh,2023-03-28,,3,nestling,"3/14: small eggs; 4/4: two live chicks & one dead chick 4/20: large dead SMWH in nest, likely not from 401" +2023,6th_bridge,401,smwh,2023-04-04,,2,nestling,"3/14: small eggs; 4/4: two live chicks & one dead chick 4/20: large dead SMWH in nest, likely not from 401" +2023,6th_bridge,401,smwh,2023-04-15,,,empty,"3/14: small eggs; 4/4: two live chicks & one dead chick 4/20: large dead SMWH in nest, likely not from 401" +2023,6th_bridge,401,smwh,2023-04-20,,,empty,"3/14: small eggs; 4/4: two live chicks & one dead chick 4/20: large dead SMWH in nest, likely not from 401" +2023,6th_bridge,401,smwh,2023-04-27,,,missed,"3/14: small eggs; 4/4: two live chicks & one dead chick 4/20: large dead SMWH in nest, likely not from 401" +2023,6th_bridge,401,smwh,2023-05-03,,,,"3/14: small eggs; 4/4: two live chicks & one dead chick 4/20: large dead SMWH in nest, likely not from 401" +2023,6th_bridge,403,whib,2023-02-22,,,,"3/21: final egg pipping 3/28: dead chick beside nest; 4/4: two chicks certain" +2023,6th_bridge,403,whib,2023-03-01,,,,"3/21: final egg pipping 3/28: dead chick beside nest; 4/4: two chicks certain" +2023,6th_bridge,403,whib,2023-03-08,4,,incubating,"3/21: final egg pipping 3/28: dead chick beside nest; 4/4: two chicks certain" +2023,6th_bridge,403,whib,2023-03-14,4,,incubating,"3/21: final egg pipping 3/28: dead chick beside nest; 4/4: two chicks certain" +2023,6th_bridge,403,whib,2023-03-21,1,3,pipping,"3/21: final egg pipping 3/28: dead chick beside nest; 4/4: two chicks certain" +2023,6th_bridge,403,whib,2023-03-28,,1,nestling,"3/21: final egg pipping 3/28: dead chick beside nest; 4/4: two chicks certain" +2023,6th_bridge,403,whib,2023-04-04,,2,nestling,"3/21: final egg pipping 3/28: dead chick beside nest; 4/4: two chicks certain" +2023,6th_bridge,403,whib,2023-04-15,,,empty,"3/21: final egg pipping 3/28: dead chick beside nest; 4/4: two chicks certain" +2023,6th_bridge,403,whib,2023-04-20,,,pulled,"3/21: final egg pipping 3/28: dead chick beside nest; 4/4: two chicks certain" +2023,6th_bridge,403,whib,2023-04-27,,,,"3/21: final egg pipping 3/28: dead chick beside nest; 4/4: two chicks certain" +2023,6th_bridge,403,whib,2023-05-03,,,,"3/21: final egg pipping 3/28: dead chick beside nest; 4/4: two chicks certain" +2023,6th_bridge,405,smwh,2023-02-22,,,,"3/8: very small eggs" +2023,6th_bridge,405,smwh,2023-03-01,,,,"3/8: very small eggs" +2023,6th_bridge,405,smwh,2023-03-08,2,,incubating,"3/8: very small eggs" +2023,6th_bridge,405,smwh,2023-03-14,2,,incubating,"3/8: very small eggs" +2023,6th_bridge,405,smwh,2023-03-21,,2,nestling,"3/8: very small eggs" +2023,6th_bridge,405,smwh,2023-03-28,,1,nestling,"3/8: very small eggs" +2023,6th_bridge,405,smwh,2023-04-04,,,empty,"3/8: very small eggs" +2023,6th_bridge,405,smwh,2023-04-15,,,,"3/8: very small eggs" +2023,6th_bridge,405,smwh,2023-04-20,,,pulled,"3/8: very small eggs" +2023,6th_bridge,405,smwh,2023-04-27,,,,"3/8: very small eggs" +2023,6th_bridge,405,smwh,2023-05-03,,,,"3/8: very small eggs" +2023,6th_bridge,407,sneg,2023-02-22,,,,"3/28: chicks climbing around 4/15: 1 freshly dead chick" +2023,6th_bridge,407,sneg,2023-03-01,,,,"3/28: chicks climbing around 4/15: 1 freshly dead chick" +2023,6th_bridge,407,sneg,2023-03-08,3,,incubating,"3/28: chicks climbing around 4/15: 1 freshly dead chick" +2023,6th_bridge,407,sneg,2023-03-14,,3,nestling,"3/28: chicks climbing around 4/15: 1 freshly dead chick" +2023,6th_bridge,407,sneg,2023-03-21,,3,nestling,"3/28: chicks climbing around 4/15: 1 freshly dead chick" +2023,6th_bridge,407,sneg,2023-03-28,,3,nestling,"3/28: chicks climbing around 4/15: 1 freshly dead chick" +2023,6th_bridge,407,sneg,2023-04-04,,3,nestling,"3/28: chicks climbing around 4/15: 1 freshly dead chick" +2023,6th_bridge,407,sneg,2023-04-15,,,empty,"3/28: chicks climbing around 4/15: 1 freshly dead chick" +2023,6th_bridge,407,sneg,2023-04-20,,,pulled,"3/28: chicks climbing around 4/15: 1 freshly dead chick" +2023,6th_bridge,407,sneg,2023-04-27,,,,"3/28: chicks climbing around 4/15: 1 freshly dead chick" +2023,6th_bridge,407,sneg,2023-05-03,,,,"3/28: chicks climbing around 4/15: 1 freshly dead chick" +2023,6th_bridge,409,smwh,2023-02-22,,,,"3/8: very small eggs; 4/4: two branchlings" +2023,6th_bridge,409,smwh,2023-03-01,,,,"3/8: very small eggs; 4/4: two branchlings" +2023,6th_bridge,409,smwh,2023-03-08,3,,incubating,"3/8: very small eggs; 4/4: two branchlings" +2023,6th_bridge,409,smwh,2023-03-14,,3,wet_chick,"3/8: very small eggs; 4/4: two branchlings" +2023,6th_bridge,409,smwh,2023-03-21,,3,nestling,"3/8: very small eggs; 4/4: two branchlings" +2023,6th_bridge,409,smwh,2023-03-28,,3,nestling,"3/8: very small eggs; 4/4: two branchlings" +2023,6th_bridge,409,smwh,2023-04-04,,,empty,"3/8: very small eggs; 4/4: two branchlings" +2023,6th_bridge,409,smwh,2023-04-15,,,empty,"3/8: very small eggs; 4/4: two branchlings" +2023,6th_bridge,409,smwh,2023-04-20,,,pulled,"3/8: very small eggs; 4/4: two branchlings" +2023,6th_bridge,409,smwh,2023-04-27,,,,"3/8: very small eggs; 4/4: two branchlings" +2023,6th_bridge,409,smwh,2023-05-03,,,,"3/8: very small eggs; 4/4: two branchlings" +2023,6th_bridge,524,whib,2023-02-22,,,,"4/20: eggs warm" +2023,6th_bridge,524,whib,2023-03-01,,,,"4/20: eggs warm" +2023,6th_bridge,524,whib,2023-03-08,,,,"4/20: eggs warm" +2023,6th_bridge,524,whib,2023-03-14,,,,"4/20: eggs warm" +2023,6th_bridge,524,whib,2023-03-21,1,,incubating,"4/20: eggs warm" +2023,6th_bridge,524,whib,2023-03-28,2,,incubating,"4/20: eggs warm" +2023,6th_bridge,524,whib,2023-04-04,2,,incubating,"4/20: eggs warm" +2023,6th_bridge,524,whib,2023-04-15,2,,incubating,"4/20: eggs warm" +2023,6th_bridge,524,whib,2023-04-20,2,,incubating,"4/20: eggs warm" +2023,6th_bridge,524,whib,2023-04-27,,,empty,"4/20: eggs warm" +2023,6th_bridge,524,whib,2023-05-03,,,,"4/20: eggs warm" +2023,6th_bridge,411,whib,2023-02-22,,,,"3/28: certain of nest contents; 4/4: two dead eggs, one chick certain 4/20: flag pulled" +2023,6th_bridge,411,whib,2023-03-01,,,,"3/28: certain of nest contents; 4/4: two dead eggs, one chick certain 4/20: flag pulled" +2023,6th_bridge,411,whib,2023-03-08,3,,incubating,"3/28: certain of nest contents; 4/4: two dead eggs, one chick certain 4/20: flag pulled" +2023,6th_bridge,411,whib,2023-03-14,2,,incubating,"3/28: certain of nest contents; 4/4: two dead eggs, one chick certain 4/20: flag pulled" +2023,6th_bridge,411,whib,2023-03-21,2,,pipping,"3/28: certain of nest contents; 4/4: two dead eggs, one chick certain 4/20: flag pulled" +2023,6th_bridge,411,whib,2023-03-28,2,1,hatching,"3/28: certain of nest contents; 4/4: two dead eggs, one chick certain 4/20: flag pulled" +2023,6th_bridge,411,whib,2023-04-04,,1,nestling,"3/28: certain of nest contents; 4/4: two dead eggs, one chick certain 4/20: flag pulled" +2023,6th_bridge,411,whib,2023-04-15,,,missed,"3/28: certain of nest contents; 4/4: two dead eggs, one chick certain 4/20: flag pulled" +2023,6th_bridge,411,whib,2023-04-20,,,empty,"3/28: certain of nest contents; 4/4: two dead eggs, one chick certain 4/20: flag pulled" +2023,6th_bridge,411,whib,2023-04-27,,,,"3/28: certain of nest contents; 4/4: two dead eggs, one chick certain 4/20: flag pulled" +2023,6th_bridge,411,whib,2023-05-03,,,,"3/28: certain of nest contents; 4/4: two dead eggs, one chick certain 4/20: flag pulled" +2023,6th_bridge,413,whib,2023-02-22,,,,"4/15: at least one branchling between 413 and 415" +2023,6th_bridge,413,whib,2023-03-01,,,,"4/15: at least one branchling between 413 and 415" +2023,6th_bridge,413,whib,2023-03-08,2,,incubating,"4/15: at least one branchling between 413 and 415" +2023,6th_bridge,413,whib,2023-03-14,2,,incubating,"4/15: at least one branchling between 413 and 415" +2023,6th_bridge,413,whib,2023-03-21,1,,incubating,"4/15: at least one branchling between 413 and 415" +2023,6th_bridge,413,whib,2023-03-28,,1,nestling,"4/15: at least one branchling between 413 and 415" +2023,6th_bridge,413,whib,2023-04-04,,1,nestling,"4/15: at least one branchling between 413 and 415" +2023,6th_bridge,413,whib,2023-04-15,,,empty,"4/15: at least one branchling between 413 and 415" +2023,6th_bridge,413,whib,2023-04-20,,,pulled,"4/15: at least one branchling between 413 and 415" +2023,6th_bridge,413,whib,2023-04-27,,,,"4/15: at least one branchling between 413 and 415" +2023,6th_bridge,413,whib,2023-05-03,,,,"4/15: at least one branchling between 413 and 415" +2023,6th_bridge,415,whib,2023-02-22,,,,"3/28: chicks big 4/15: at least one branchling between 413 and 4154/20: flag pulled" +2023,6th_bridge,415,whib,2023-03-01,,,,"3/28: chicks big 4/15: at least one branchling between 413 and 4154/20: flag pulled" +2023,6th_bridge,415,whib,2023-03-08,3,,incubating,"3/28: chicks big 4/15: at least one branchling between 413 and 4154/20: flag pulled" +2023,6th_bridge,415,whib,2023-03-14,3,,incubating,"3/28: chicks big 4/15: at least one branchling between 413 and 4154/20: flag pulled" +2023,6th_bridge,415,whib,2023-03-21,,2,nestling,"3/28: chicks big 4/15: at least one branchling between 413 and 4154/20: flag pulled" +2023,6th_bridge,415,whib,2023-03-28,,2,nestling,"3/28: chicks big 4/15: at least one branchling between 413 and 4154/20: flag pulled" +2023,6th_bridge,415,whib,2023-04-04,,1,nestling,"3/28: chicks big 4/15: at least one branchling between 413 and 4154/20: flag pulled" +2023,6th_bridge,415,whib,2023-04-15,,1,nestling,"3/28: chicks big 4/15: at least one branchling between 413 and 4154/20: flag pulled" +2023,6th_bridge,415,whib,2023-04-20,,,empty,"3/28: chicks big 4/15: at least one branchling between 413 and 4154/20: flag pulled" +2023,6th_bridge,415,whib,2023-04-27,,,,"3/28: chicks big 4/15: at least one branchling between 413 and 4154/20: flag pulled" +2023,6th_bridge,415,whib,2023-05-03,,,,"3/28: chicks big 4/15: at least one branchling between 413 and 4154/20: flag pulled" +2023,6th_bridge,417,whib,2023-02-22,,,,"3/21: nest collapsed" +2023,6th_bridge,417,whib,2023-03-01,,,,"3/21: nest collapsed" +2023,6th_bridge,417,whib,2023-03-08,3,,incubating,"3/21: nest collapsed" +2023,6th_bridge,417,whib,2023-03-14,3,,incubating,"3/21: nest collapsed" +2023,6th_bridge,417,whib,2023-03-21,,,empty,"3/21: nest collapsed" +2023,6th_bridge,417,whib,2023-03-28,,,,"3/21: nest collapsed" +2023,6th_bridge,417,whib,2023-04-04,,,,"3/21: nest collapsed" +2023,6th_bridge,417,whib,2023-04-15,,,,"3/21: nest collapsed" +2023,6th_bridge,417,whib,2023-04-20,,,pulled,"3/21: nest collapsed" +2023,6th_bridge,417,whib,2023-04-27,,,,"3/21: nest collapsed" +2023,6th_bridge,417,whib,2023-05-03,,,,"3/21: nest collapsed" +2023,6th_bridge,419,smwh,2023-02-22,,,,"4/4: one small chick 4/15: 2C certain 4/20: flag pulled, nest gone" +2023,6th_bridge,419,smwh,2023-03-01,,,,"4/4: one small chick 4/15: 2C certain 4/20: flag pulled, nest gone" +2023,6th_bridge,419,smwh,2023-03-08,3,,incubating,"4/4: one small chick 4/15: 2C certain 4/20: flag pulled, nest gone" +2023,6th_bridge,419,smwh,2023-03-14,3,,incubating,"4/4: one small chick 4/15: 2C certain 4/20: flag pulled, nest gone" +2023,6th_bridge,419,smwh,2023-03-21,3,,incubating,"4/4: one small chick 4/15: 2C certain 4/20: flag pulled, nest gone" +2023,6th_bridge,419,smwh,2023-03-28,,3,nestling,"4/4: one small chick 4/15: 2C certain 4/20: flag pulled, nest gone" +2023,6th_bridge,419,smwh,2023-04-04,,1,nestling,"4/4: one small chick 4/15: 2C certain 4/20: flag pulled, nest gone" +2023,6th_bridge,419,smwh,2023-04-15,,2,nestling,"4/4: one small chick 4/15: 2C certain 4/20: flag pulled, nest gone" +2023,6th_bridge,419,smwh,2023-04-20,,,empty,"4/4: one small chick 4/15: 2C certain 4/20: flag pulled, nest gone" +2023,6th_bridge,419,smwh,2023-04-27,,,,"4/4: one small chick 4/15: 2C certain 4/20: flag pulled, nest gone" +2023,6th_bridge,419,smwh,2023-05-03,,,,"4/4: one small chick 4/15: 2C certain 4/20: flag pulled, nest gone" +2023,6th_bridge,421,smwh,2023-02-22,,,,"3/8: very small eggs 4/20: nest gone, pulled flag" +2023,6th_bridge,421,smwh,2023-03-01,,,,"3/8: very small eggs 4/20: nest gone, pulled flag" +2023,6th_bridge,421,smwh,2023-03-08,4,,incubating,"3/8: very small eggs 4/20: nest gone, pulled flag" +2023,6th_bridge,421,smwh,2023-03-14,4,,incubating,"3/8: very small eggs 4/20: nest gone, pulled flag" +2023,6th_bridge,421,smwh,2023-03-21,,4,nestling,"3/8: very small eggs 4/20: nest gone, pulled flag" +2023,6th_bridge,421,smwh,2023-03-28,,4,nestling,"3/8: very small eggs 4/20: nest gone, pulled flag" +2023,6th_bridge,421,smwh,2023-04-04,,2,nestling,"3/8: very small eggs 4/20: nest gone, pulled flag" +2023,6th_bridge,421,smwh,2023-04-15,,,empty,"3/8: very small eggs 4/20: nest gone, pulled flag" +2023,6th_bridge,421,smwh,2023-04-20,,,pulled,"3/8: very small eggs 4/20: nest gone, pulled flag" +2023,6th_bridge,421,smwh,2023-04-27,,,,"3/8: very small eggs 4/20: nest gone, pulled flag" +2023,6th_bridge,421,smwh,2023-05-03,,,,"3/8: very small eggs 4/20: nest gone, pulled flag" +2023,6th_bridge,423,whib,2023-02-22,,,,"3/21: GLIB takeover" +2023,6th_bridge,423,whib,2023-03-01,,,,"3/21: GLIB takeover" +2023,6th_bridge,423,whib,2023-03-08,1,,incubating,"3/21: GLIB takeover" +2023,6th_bridge,423,whib,2023-03-14,,,empty,"3/21: GLIB takeover" +2023,6th_bridge,423,whib,2023-03-21,,,,"3/21: GLIB takeover" +2023,6th_bridge,423,whib,2023-03-28,,,,"3/21: GLIB takeover" +2023,6th_bridge,423,whib,2023-04-04,,,,"3/21: GLIB takeover" +2023,6th_bridge,423,whib,2023-04-15,,,,"3/21: GLIB takeover" +2023,6th_bridge,423,whib,2023-04-20,,,,"3/21: GLIB takeover" +2023,6th_bridge,423,whib,2023-04-27,,,,"3/21: GLIB takeover" +2023,6th_bridge,423,whib,2023-05-03,,,,"3/21: GLIB takeover" +2023,6th_bridge,*423,glib,2023-02-22,,,,"4/20: flag pulled" +2023,6th_bridge,*423,glib,2023-03-01,,,,"4/20: flag pulled" +2023,6th_bridge,*423,glib,2023-03-08,,,,"4/20: flag pulled" +2023,6th_bridge,*423,glib,2023-03-14,,,,"4/20: flag pulled" +2023,6th_bridge,*423,glib,2023-03-21,1,,incubating,"4/20: flag pulled" +2023,6th_bridge,*423,glib,2023-03-28,3,,incubating,"4/20: flag pulled" +2023,6th_bridge,*423,glib,2023-04-04,3,,incubating,"4/20: flag pulled" +2023,6th_bridge,*423,glib,2023-04-15,,2,nestling,"4/20: flag pulled" +2023,6th_bridge,*423,glib,2023-04-20,,,empty,"4/20: flag pulled" +2023,6th_bridge,*423,glib,2023-04-27,,,,"4/20: flag pulled" +2023,6th_bridge,*423,glib,2023-05-03,,,,"4/20: flag pulled" +2023,6th_bridge,425,whib,2023-02-22,,,,"4/20: flag pulled, broken eggs" +2023,6th_bridge,425,whib,2023-03-01,,,,"4/20: flag pulled, broken eggs" +2023,6th_bridge,425,whib,2023-03-08,2,,incubating,"4/20: flag pulled, broken eggs" +2023,6th_bridge,425,whib,2023-03-14,2,,incubating,"4/20: flag pulled, broken eggs" +2023,6th_bridge,425,whib,2023-03-21,1,,incubating,"4/20: flag pulled, broken eggs" +2023,6th_bridge,425,whib,2023-03-28,2,,incubating,"4/20: flag pulled, broken eggs" +2023,6th_bridge,425,whib,2023-04-04,2,,incubating,"4/20: flag pulled, broken eggs" +2023,6th_bridge,425,whib,2023-04-15,,,empty,"4/20: flag pulled, broken eggs" +2023,6th_bridge,425,whib,2023-04-20,,,pulled,"4/20: flag pulled, broken eggs" +2023,6th_bridge,425,whib,2023-04-27,,,,"4/20: flag pulled, broken eggs" +2023,6th_bridge,425,whib,2023-05-03,,,,"4/20: flag pulled, broken eggs" +2023,6th_bridge,427,whib,2023-02-22,,,, +2023,6th_bridge,427,whib,2023-03-01,,,, +2023,6th_bridge,427,whib,2023-03-08,1,,incubating, +2023,6th_bridge,427,whib,2023-03-14,1,,incubating, +2023,6th_bridge,427,whib,2023-03-21,,,empty, +2023,6th_bridge,427,whib,2023-03-28,,,empty, +2023,6th_bridge,427,whib,2023-04-04,,,, +2023,6th_bridge,427,whib,2023-04-15,,,, +2023,6th_bridge,427,whib,2023-04-20,,,, +2023,6th_bridge,427,whib,2023-04-27,,,, +2023,6th_bridge,427,whib,2023-05-03,,,, +2023,6th_bridge,*427,trhe,2023-02-22,,,,"4/20: Adult TRHE at nest" +2023,6th_bridge,*427,trhe,2023-03-01,,,,"4/20: Adult TRHE at nest" +2023,6th_bridge,*427,trhe,2023-03-08,,,,"4/20: Adult TRHE at nest" +2023,6th_bridge,*427,trhe,2023-03-14,,,,"4/20: Adult TRHE at nest" +2023,6th_bridge,*427,trhe,2023-03-21,,,,"4/20: Adult TRHE at nest" +2023,6th_bridge,*427,trhe,2023-03-28,4,,incubating,"4/20: Adult TRHE at nest" +2023,6th_bridge,*427,trhe,2023-04-04,4,,incubating,"4/20: Adult TRHE at nest" +2023,6th_bridge,*427,trhe,2023-04-15,4,,incubating,"4/20: Adult TRHE at nest" +2023,6th_bridge,*427,trhe,2023-04-20,,4,chick_dry,"4/20: Adult TRHE at nest" +2023,6th_bridge,*427,trhe,2023-04-27,,,empty,"4/20: Adult TRHE at nest" +2023,6th_bridge,*427,trhe,2023-05-03,,,,"4/20: Adult TRHE at nest" +2023,6th_bridge,429,greg,2023-02-22,,,,"3/8: one pipping/cracking 4/20: chick in death hunch, abandoned; 4/27: Chick from last week dead. 2nd GREG nest on transect" +2023,6th_bridge,429,greg,2023-03-01,,,,"3/8: one pipping/cracking 4/20: chick in death hunch, abandoned; 4/27: Chick from last week dead. 2nd GREG nest on transect" +2023,6th_bridge,429,greg,2023-03-08,3,,incubating,"3/8: one pipping/cracking 4/20: chick in death hunch, abandoned; 4/27: Chick from last week dead. 2nd GREG nest on transect" +2023,6th_bridge,429,greg,2023-03-14,,3,nestling,"3/8: one pipping/cracking 4/20: chick in death hunch, abandoned; 4/27: Chick from last week dead. 2nd GREG nest on transect" +2023,6th_bridge,429,greg,2023-03-21,,3,nestling,"3/8: one pipping/cracking 4/20: chick in death hunch, abandoned; 4/27: Chick from last week dead. 2nd GREG nest on transect" +2023,6th_bridge,429,greg,2023-03-28,,2,nestling,"3/8: one pipping/cracking 4/20: chick in death hunch, abandoned; 4/27: Chick from last week dead. 2nd GREG nest on transect" +2023,6th_bridge,429,greg,2023-04-04,,2,nestling,"3/8: one pipping/cracking 4/20: chick in death hunch, abandoned; 4/27: Chick from last week dead. 2nd GREG nest on transect" +2023,6th_bridge,429,greg,2023-04-15,,1,nestling,"3/8: one pipping/cracking 4/20: chick in death hunch, abandoned; 4/27: Chick from last week dead. 2nd GREG nest on transect" +2023,6th_bridge,429,greg,2023-04-20,,1,nestling,"3/8: one pipping/cracking 4/20: chick in death hunch, abandoned; 4/27: Chick from last week dead. 2nd GREG nest on transect" +2023,6th_bridge,429,greg,2023-04-27,,,empty,"3/8: one pipping/cracking 4/20: chick in death hunch, abandoned; 4/27: Chick from last week dead. 2nd GREG nest on transect" +2023,6th_bridge,429,greg,2023-05-03,,,,"3/8: one pipping/cracking 4/20: chick in death hunch, abandoned; 4/27: Chick from last week dead. 2nd GREG nest on transect" +2023,6th_bridge,431,whib,2023-02-22,,,, +2023,6th_bridge,431,whib,2023-03-01,,,, +2023,6th_bridge,431,whib,2023-03-08,2,,incubating, +2023,6th_bridge,431,whib,2023-03-14,2,,incubating, +2023,6th_bridge,431,whib,2023-03-21,1,1,hatching, +2023,6th_bridge,431,whib,2023-03-28,,1,nestling, +2023,6th_bridge,431,whib,2023-04-04,,1,nestling, +2023,6th_bridge,431,whib,2023-04-15,,,empty, +2023,6th_bridge,431,whib,2023-04-20,,,pulled, +2023,6th_bridge,431,whib,2023-04-27,,,, +2023,6th_bridge,431,whib,2023-05-03,,,, +2023,6th_bridge,449,whib,2023-02-22,,,,"3/8: small pink flag 4/15: fledglings nearby" +2023,6th_bridge,449,whib,2023-03-01,,,,"3/8: small pink flag 4/15: fledglings nearby" +2023,6th_bridge,449,whib,2023-03-08,2,,incubating,"3/8: small pink flag 4/15: fledglings nearby" +2023,6th_bridge,449,whib,2023-03-14,2,,incubating,"3/8: small pink flag 4/15: fledglings nearby" +2023,6th_bridge,449,whib,2023-03-21,1,1,hatching,"3/8: small pink flag 4/15: fledglings nearby" +2023,6th_bridge,449,whib,2023-03-28,1,1,hatching,"3/8: small pink flag 4/15: fledglings nearby" +2023,6th_bridge,449,whib,2023-04-04,,,empty,"3/8: small pink flag 4/15: fledglings nearby" +2023,6th_bridge,449,whib,2023-04-15,,,empty,"3/8: small pink flag 4/15: fledglings nearby" +2023,6th_bridge,449,whib,2023-04-20,,,pulled,"3/8: small pink flag 4/15: fledglings nearby" +2023,6th_bridge,449,whib,2023-04-27,,,,"3/8: small pink flag 4/15: fledglings nearby" +2023,6th_bridge,449,whib,2023-05-03,,,,"3/8: small pink flag 4/15: fledglings nearby" +2023,6th_bridge,451,rosp,2023-02-22,,,,"4/4: one dead chick 4/20: flag pulled" +2023,6th_bridge,451,rosp,2023-03-01,,,,"4/4: one dead chick 4/20: flag pulled" +2023,6th_bridge,451,rosp,2023-03-08,3,,incubating,"4/4: one dead chick 4/20: flag pulled" +2023,6th_bridge,451,rosp,2023-03-14,3,,incubating,"4/4: one dead chick 4/20: flag pulled" +2023,6th_bridge,451,rosp,2023-03-21,,3,chick_dry,"4/4: one dead chick 4/20: flag pulled" +2023,6th_bridge,451,rosp,2023-03-28,,3,nestling,"4/4: one dead chick 4/20: flag pulled" +2023,6th_bridge,451,rosp,2023-04-04,,2,nestling,"4/4: one dead chick 4/20: flag pulled" +2023,6th_bridge,451,rosp,2023-04-15,,1,nestling,"4/4: one dead chick 4/20: flag pulled" +2023,6th_bridge,451,rosp,2023-04-20,,,empty,"4/4: one dead chick 4/20: flag pulled" +2023,6th_bridge,451,rosp,2023-04-27,,,,"4/4: one dead chick 4/20: flag pulled" +2023,6th_bridge,451,rosp,2023-05-03,,,,"4/4: one dead chick 4/20: flag pulled" +2023,6th_bridge,453,smwh,2023-02-22,,,,"3/14: small eggs 4/20: flag pulled" +2023,6th_bridge,453,smwh,2023-03-01,,,,"3/14: small eggs 4/20: flag pulled" +2023,6th_bridge,453,smwh,2023-03-08,,,,"3/14: small eggs 4/20: flag pulled" +2023,6th_bridge,453,smwh,2023-03-14,3,,incubating,"3/14: small eggs 4/20: flag pulled" +2023,6th_bridge,453,smwh,2023-03-21,3,,incubating,"3/14: small eggs 4/20: flag pulled" +2023,6th_bridge,453,smwh,2023-03-28,,3,nestling,"3/14: small eggs 4/20: flag pulled" +2023,6th_bridge,453,smwh,2023-04-04,,1,nestling,"3/14: small eggs 4/20: flag pulled" +2023,6th_bridge,453,smwh,2023-04-15,,,missed,"3/14: small eggs 4/20: flag pulled" +2023,6th_bridge,453,smwh,2023-04-20,,,empty,"3/14: small eggs 4/20: flag pulled" +2023,6th_bridge,453,smwh,2023-04-27,,,,"3/14: small eggs 4/20: flag pulled" +2023,6th_bridge,453,smwh,2023-05-03,,,,"3/14: small eggs 4/20: flag pulled" +2023,6th_bridge,457,whib,2023-02-22,,,, +2023,6th_bridge,457,whib,2023-03-01,,,, +2023,6th_bridge,457,whib,2023-03-08,1,,incubating, +2023,6th_bridge,457,whib,2023-03-14,1,,incubating, +2023,6th_bridge,457,whib,2023-03-21,,1,nestling, +2023,6th_bridge,457,whib,2023-03-28,,1,nestling, +2023,6th_bridge,457,whib,2023-04-04,,1,nestling, +2023,6th_bridge,457,whib,2023-04-15,,,empty, +2023,6th_bridge,457,whib,2023-04-20,,,pulled, +2023,6th_bridge,457,whib,2023-04-27,,,, +2023,6th_bridge,457,whib,2023-05-03,,,, +2023,6th_bridge,461,sneg,2023-02-22,,,,"3/8: walk directly under nest; SNEG yelling at us 3/28: angry SNEG nearby 4/4: 2 chicks certain 4/15: one live chick and one dead chick; 4/27: Flag was in nest . MT flag pulled" +2023,6th_bridge,461,sneg,2023-03-01,,,,"3/8: walk directly under nest; SNEG yelling at us 3/28: angry SNEG nearby 4/4: 2 chicks certain 4/15: one live chick and one dead chick; 4/27: Flag was in nest . MT flag pulled" +2023,6th_bridge,461,sneg,2023-03-08,3,,incubating,"3/8: walk directly under nest; SNEG yelling at us 3/28: angry SNEG nearby 4/4: 2 chicks certain 4/15: one live chick and one dead chick; 4/27: Flag was in nest . MT flag pulled" +2023,6th_bridge,461,sneg,2023-03-14,3,,incubating,"3/8: walk directly under nest; SNEG yelling at us 3/28: angry SNEG nearby 4/4: 2 chicks certain 4/15: one live chick and one dead chick; 4/27: Flag was in nest . MT flag pulled" +2023,6th_bridge,461,sneg,2023-03-21,3,,incubating,"3/8: walk directly under nest; SNEG yelling at us 3/28: angry SNEG nearby 4/4: 2 chicks certain 4/15: one live chick and one dead chick; 4/27: Flag was in nest . MT flag pulled" +2023,6th_bridge,461,sneg,2023-03-28,,3,nestling,"3/8: walk directly under nest; SNEG yelling at us 3/28: angry SNEG nearby 4/4: 2 chicks certain 4/15: one live chick and one dead chick; 4/27: Flag was in nest . MT flag pulled" +2023,6th_bridge,461,sneg,2023-04-04,,2,nestling,"3/8: walk directly under nest; SNEG yelling at us 3/28: angry SNEG nearby 4/4: 2 chicks certain 4/15: one live chick and one dead chick; 4/27: Flag was in nest . MT flag pulled" +2023,6th_bridge,461,sneg,2023-04-15,,1,nestling,"3/8: walk directly under nest; SNEG yelling at us 3/28: angry SNEG nearby 4/4: 2 chicks certain 4/15: one live chick and one dead chick; 4/27: Flag was in nest . MT flag pulled" +2023,6th_bridge,461,sneg,2023-04-20,,,missed,"3/8: walk directly under nest; SNEG yelling at us 3/28: angry SNEG nearby 4/4: 2 chicks certain 4/15: one live chick and one dead chick; 4/27: Flag was in nest . MT flag pulled" +2023,6th_bridge,461,sneg,2023-04-27,,,empty,"3/8: walk directly under nest; SNEG yelling at us 3/28: angry SNEG nearby 4/4: 2 chicks certain 4/15: one live chick and one dead chick; 4/27: Flag was in nest . MT flag pulled" +2023,6th_bridge,461,sneg,2023-05-03,,,,"3/8: walk directly under nest; SNEG yelling at us 3/28: angry SNEG nearby 4/4: 2 chicks certain 4/15: one live chick and one dead chick; 4/27: Flag was in nest . MT flag pulled" +2023,6th_bridge,469,whib,2023-02-22,,,,"3/21: nest gone" +2023,6th_bridge,469,whib,2023-03-01,,,,"3/21: nest gone" +2023,6th_bridge,469,whib,2023-03-08,2,,incubating,"3/21: nest gone" +2023,6th_bridge,469,whib,2023-03-14,,,empty,"3/21: nest gone" +2023,6th_bridge,469,whib,2023-03-21,,,empty,"3/21: nest gone" +2023,6th_bridge,469,whib,2023-03-28,,,,"3/21: nest gone" +2023,6th_bridge,469,whib,2023-04-04,,,,"3/21: nest gone" +2023,6th_bridge,469,whib,2023-04-15,,,,"3/21: nest gone" +2023,6th_bridge,469,whib,2023-04-20,,,pulled,"3/21: nest gone" +2023,6th_bridge,469,whib,2023-04-27,,,,"3/21: nest gone" +2023,6th_bridge,469,whib,2023-05-03,,,,"3/21: nest gone" +2023,6th_bridge,467,whib,2023-02-22,,,,"4/27: flag pulled" +2023,6th_bridge,467,whib,2023-03-01,,,,"4/27: flag pulled" +2023,6th_bridge,467,whib,2023-03-08,2,,incubating,"4/27: flag pulled" +2023,6th_bridge,467,whib,2023-03-14,2,,incubating,"4/27: flag pulled" +2023,6th_bridge,467,whib,2023-03-21,,2,nestling,"4/27: flag pulled" +2023,6th_bridge,467,whib,2023-03-28,,1,nestling,"4/27: flag pulled" +2023,6th_bridge,467,whib,2023-04-04,,2,nestling,"4/27: flag pulled" +2023,6th_bridge,467,whib,2023-04-15,,,empty,"4/27: flag pulled" +2023,6th_bridge,467,whib,2023-04-20,,,missed,"4/27: flag pulled" +2023,6th_bridge,467,whib,2023-04-27,,,empty,"4/27: flag pulled" +2023,6th_bridge,467,whib,2023-05-03,,,,"4/27: flag pulled" +2023,6th_bridge,475,whib,2023-02-22,,,,"4/4: dead chick on ground" +2023,6th_bridge,475,whib,2023-03-01,,,,"4/4: dead chick on ground" +2023,6th_bridge,475,whib,2023-03-08,2,,incubating,"4/4: dead chick on ground" +2023,6th_bridge,475,whib,2023-03-14,2,,incubating,"4/4: dead chick on ground" +2023,6th_bridge,475,whib,2023-03-21,,2,nestling,"4/4: dead chick on ground" +2023,6th_bridge,475,whib,2023-03-28,,2,nestling,"4/4: dead chick on ground" +2023,6th_bridge,475,whib,2023-04-04,,1,nestling,"4/4: dead chick on ground" +2023,6th_bridge,475,whib,2023-04-15,,,empty,"4/4: dead chick on ground" +2023,6th_bridge,475,whib,2023-04-20,,,pulled,"4/4: dead chick on ground" +2023,6th_bridge,475,whib,2023-04-27,,,,"4/4: dead chick on ground" +2023,6th_bridge,475,whib,2023-05-03,,,,"4/4: dead chick on ground" +2023,6th_bridge,463,bcnh,2023-02-22,,,, +2023,6th_bridge,463,bcnh,2023-03-01,,,, +2023,6th_bridge,463,bcnh,2023-03-08,,,, +2023,6th_bridge,463,bcnh,2023-03-14,3,,incubating, +2023,6th_bridge,463,bcnh,2023-03-21,3,,pipping, +2023,6th_bridge,463,bcnh,2023-03-28,,3,nestling, +2023,6th_bridge,463,bcnh,2023-04-04,,2,nestling, +2023,6th_bridge,463,bcnh,2023-04-15,,,empty, +2023,6th_bridge,463,bcnh,2023-04-20,,,pulled, +2023,6th_bridge,463,bcnh,2023-04-27,,,, +2023,6th_bridge,463,bcnh,2023-05-03,,,, +2023,6th_bridge,465,smwh,2023-02-22,,,,"3/14: small eggs 3/28: chick wet, JUST hatched" +2023,6th_bridge,465,smwh,2023-03-01,,,,"3/14: small eggs 3/28: chick wet, JUST hatched" +2023,6th_bridge,465,smwh,2023-03-08,,,,"3/14: small eggs 3/28: chick wet, JUST hatched" +2023,6th_bridge,465,smwh,2023-03-14,4,,incubating,"3/14: small eggs 3/28: chick wet, JUST hatched" +2023,6th_bridge,465,smwh,2023-03-21,4,,incubating,"3/14: small eggs 3/28: chick wet, JUST hatched" +2023,6th_bridge,465,smwh,2023-03-28,3,1,wet_chick,"3/14: small eggs 3/28: chick wet, JUST hatched" +2023,6th_bridge,465,smwh,2023-04-04,,4,nestling,"3/14: small eggs 3/28: chick wet, JUST hatched" +2023,6th_bridge,465,smwh,2023-04-15,,,empty,"3/14: small eggs 3/28: chick wet, JUST hatched" +2023,6th_bridge,465,smwh,2023-04-20,,,pulled,"3/14: small eggs 3/28: chick wet, JUST hatched" +2023,6th_bridge,465,smwh,2023-04-27,,,,"3/14: small eggs 3/28: chick wet, JUST hatched" +2023,6th_bridge,465,smwh,2023-05-03,,,,"3/14: small eggs 3/28: chick wet, JUST hatched" +2023,6th_bridge,471,whib,2023-02-22,,,,"4/4: 2 chicks certain" +2023,6th_bridge,471,whib,2023-03-01,,,,"4/4: 2 chicks certain" +2023,6th_bridge,471,whib,2023-03-08,,,,"4/4: 2 chicks certain" +2023,6th_bridge,471,whib,2023-03-14,2,,incubating,"4/4: 2 chicks certain" +2023,6th_bridge,471,whib,2023-03-21,,2,nestling,"4/4: 2 chicks certain" +2023,6th_bridge,471,whib,2023-03-28,,2,nestling,"4/4: 2 chicks certain" +2023,6th_bridge,471,whib,2023-04-04,,2,nestling,"4/4: 2 chicks certain" +2023,6th_bridge,471,whib,2023-04-15,,,empty,"4/4: 2 chicks certain" +2023,6th_bridge,471,whib,2023-04-20,,,pulled,"4/4: 2 chicks certain" +2023,6th_bridge,471,whib,2023-04-27,,,,"4/4: 2 chicks certain" +2023,6th_bridge,471,whib,2023-05-03,,,,"4/4: 2 chicks certain" +2023,6th_bridge,473,whib,2023-02-22,,,,"4/4: 2 chicks certain" +2023,6th_bridge,473,whib,2023-03-01,,,,"4/4: 2 chicks certain" +2023,6th_bridge,473,whib,2023-03-08,,,,"4/4: 2 chicks certain" +2023,6th_bridge,473,whib,2023-03-14,3,,incubating,"4/4: 2 chicks certain" +2023,6th_bridge,473,whib,2023-03-21,,3,nestling,"4/4: 2 chicks certain" +2023,6th_bridge,473,whib,2023-03-28,,2,nestling,"4/4: 2 chicks certain" +2023,6th_bridge,473,whib,2023-04-04,,2,nestling,"4/4: 2 chicks certain" +2023,6th_bridge,473,whib,2023-04-15,,,empty,"4/4: 2 chicks certain" +2023,6th_bridge,473,whib,2023-04-20,,,pulled,"4/4: 2 chicks certain" +2023,6th_bridge,473,whib,2023-04-27,,,,"4/4: 2 chicks certain" +2023,6th_bridge,473,whib,2023-05-03,,,,"4/4: 2 chicks certain" +2023,6th_bridge,477,whib,2023-02-22,,,, +2023,6th_bridge,477,whib,2023-03-01,,,, +2023,6th_bridge,477,whib,2023-03-08,,,, +2023,6th_bridge,477,whib,2023-03-14,2,,incubating, +2023,6th_bridge,477,whib,2023-03-21,,2,nestling, +2023,6th_bridge,477,whib,2023-03-28,,1,nestling, +2023,6th_bridge,477,whib,2023-04-04,,1,nestling, +2023,6th_bridge,477,whib,2023-04-15,,,empty, +2023,6th_bridge,477,whib,2023-04-20,,,pulled, +2023,6th_bridge,477,whib,2023-04-27,,,, +2023,6th_bridge,477,whib,2023-05-03,,,, +2023,6th_bridge,479,whib,2023-02-22,,,, +2023,6th_bridge,479,whib,2023-03-01,,,, +2023,6th_bridge,479,whib,2023-03-08,,,, +2023,6th_bridge,479,whib,2023-03-14,3,,incubating, +2023,6th_bridge,479,whib,2023-03-21,,3,nestling, +2023,6th_bridge,479,whib,2023-03-28,,2,nestling, +2023,6th_bridge,479,whib,2023-04-04,,2,nestling, +2023,6th_bridge,479,whib,2023-04-15,,,empty, +2023,6th_bridge,479,whib,2023-04-20,,,pulled, +2023,6th_bridge,479,whib,2023-04-27,,,, +2023,6th_bridge,479,whib,2023-05-03,,,, +2023,6th_bridge,481,whib,2023-02-22,,,, +2023,6th_bridge,481,whib,2023-03-01,,,, +2023,6th_bridge,481,whib,2023-03-08,,,, +2023,6th_bridge,481,whib,2023-03-14,1,,incubating, +2023,6th_bridge,481,whib,2023-03-21,,1,nestling, +2023,6th_bridge,481,whib,2023-03-28,,1,nestling, +2023,6th_bridge,481,whib,2023-04-04,,2,nestling, +2023,6th_bridge,481,whib,2023-04-15,,,empty, +2023,6th_bridge,481,whib,2023-04-20,,,pulled, +2023,6th_bridge,481,whib,2023-04-27,,,, +2023,6th_bridge,481,whib,2023-05-03,,,, +2023,6th_bridge,483,whib,2023-02-22,,,,"3/28: 8 total chicks in cluster, crawling all over; 4/4: 3 total chicks in nest cluster. One pretty large dead chick in nest. 4/15: at least 5 branchlings between 483, 485, 487, 489 4/20: branchlings present for this cluster" +2023,6th_bridge,483,whib,2023-03-01,,,,"3/28: 8 total chicks in cluster, crawling all over; 4/4: 3 total chicks in nest cluster. One pretty large dead chick in nest. 4/15: at least 5 branchlings between 483, 485, 487, 489 4/20: branchlings present for this cluster" +2023,6th_bridge,483,whib,2023-03-08,,,,"3/28: 8 total chicks in cluster, crawling all over; 4/4: 3 total chicks in nest cluster. One pretty large dead chick in nest. 4/15: at least 5 branchlings between 483, 485, 487, 489 4/20: branchlings present for this cluster" +2023,6th_bridge,483,whib,2023-03-14,3,,incubating,"3/28: 8 total chicks in cluster, crawling all over; 4/4: 3 total chicks in nest cluster. One pretty large dead chick in nest. 4/15: at least 5 branchlings between 483, 485, 487, 489 4/20: branchlings present for this cluster" +2023,6th_bridge,483,whib,2023-03-21,,3,nestling,"3/28: 8 total chicks in cluster, crawling all over; 4/4: 3 total chicks in nest cluster. One pretty large dead chick in nest. 4/15: at least 5 branchlings between 483, 485, 487, 489 4/20: branchlings present for this cluster" +2023,6th_bridge,483,whib,2023-03-28,,2,nestling,"3/28: 8 total chicks in cluster, crawling all over; 4/4: 3 total chicks in nest cluster. One pretty large dead chick in nest. 4/15: at least 5 branchlings between 483, 485, 487, 489 4/20: branchlings present for this cluster" +2023,6th_bridge,483,whib,2023-04-04,,1,nestling,"3/28: 8 total chicks in cluster, crawling all over; 4/4: 3 total chicks in nest cluster. One pretty large dead chick in nest. 4/15: at least 5 branchlings between 483, 485, 487, 489 4/20: branchlings present for this cluster" +2023,6th_bridge,483,whib,2023-04-15,,,empty,"3/28: 8 total chicks in cluster, crawling all over; 4/4: 3 total chicks in nest cluster. One pretty large dead chick in nest. 4/15: at least 5 branchlings between 483, 485, 487, 489 4/20: branchlings present for this cluster" +2023,6th_bridge,483,whib,2023-04-20,,,pulled,"3/28: 8 total chicks in cluster, crawling all over; 4/4: 3 total chicks in nest cluster. One pretty large dead chick in nest. 4/15: at least 5 branchlings between 483, 485, 487, 489 4/20: branchlings present for this cluster" +2023,6th_bridge,483,whib,2023-04-27,,,,"3/28: 8 total chicks in cluster, crawling all over; 4/4: 3 total chicks in nest cluster. One pretty large dead chick in nest. 4/15: at least 5 branchlings between 483, 485, 487, 489 4/20: branchlings present for this cluster" +2023,6th_bridge,483,whib,2023-05-03,,,,"3/28: 8 total chicks in cluster, crawling all over; 4/4: 3 total chicks in nest cluster. One pretty large dead chick in nest. 4/15: at least 5 branchlings between 483, 485, 487, 489 4/20: branchlings present for this cluster" +2023,6th_bridge,485,whib,2023-02-22,,,,"3/28: 8 total chicks in cluster, crawling all over; 4/4: 3 total chicks in nest cluster 4/15: at least 5 branchlings between 483, 485, 487, 489 4/20: branchlings present for this cluster" +2023,6th_bridge,485,whib,2023-03-01,,,,"3/28: 8 total chicks in cluster, crawling all over; 4/4: 3 total chicks in nest cluster 4/15: at least 5 branchlings between 483, 485, 487, 489 4/20: branchlings present for this cluster" +2023,6th_bridge,485,whib,2023-03-08,,,,"3/28: 8 total chicks in cluster, crawling all over; 4/4: 3 total chicks in nest cluster 4/15: at least 5 branchlings between 483, 485, 487, 489 4/20: branchlings present for this cluster" +2023,6th_bridge,485,whib,2023-03-14,3,,incubating,"3/28: 8 total chicks in cluster, crawling all over; 4/4: 3 total chicks in nest cluster 4/15: at least 5 branchlings between 483, 485, 487, 489 4/20: branchlings present for this cluster" +2023,6th_bridge,485,whib,2023-03-21,,3,nestling,"3/28: 8 total chicks in cluster, crawling all over; 4/4: 3 total chicks in nest cluster 4/15: at least 5 branchlings between 483, 485, 487, 489 4/20: branchlings present for this cluster" +2023,6th_bridge,485,whib,2023-03-28,,2,nestling,"3/28: 8 total chicks in cluster, crawling all over; 4/4: 3 total chicks in nest cluster 4/15: at least 5 branchlings between 483, 485, 487, 489 4/20: branchlings present for this cluster" +2023,6th_bridge,485,whib,2023-04-04,,1,nestling,"3/28: 8 total chicks in cluster, crawling all over; 4/4: 3 total chicks in nest cluster 4/15: at least 5 branchlings between 483, 485, 487, 489 4/20: branchlings present for this cluster" +2023,6th_bridge,485,whib,2023-04-15,,,empty,"3/28: 8 total chicks in cluster, crawling all over; 4/4: 3 total chicks in nest cluster 4/15: at least 5 branchlings between 483, 485, 487, 489 4/20: branchlings present for this cluster" +2023,6th_bridge,485,whib,2023-04-20,,,pulled,"3/28: 8 total chicks in cluster, crawling all over; 4/4: 3 total chicks in nest cluster 4/15: at least 5 branchlings between 483, 485, 487, 489 4/20: branchlings present for this cluster" +2023,6th_bridge,485,whib,2023-04-27,,,,"3/28: 8 total chicks in cluster, crawling all over; 4/4: 3 total chicks in nest cluster 4/15: at least 5 branchlings between 483, 485, 487, 489 4/20: branchlings present for this cluster" +2023,6th_bridge,485,whib,2023-05-03,,,,"3/28: 8 total chicks in cluster, crawling all over; 4/4: 3 total chicks in nest cluster 4/15: at least 5 branchlings between 483, 485, 487, 489 4/20: branchlings present for this cluster" +2023,6th_bridge,487,whib,2023-02-22,,,,"3/28: 8 total chicks in cluster, crawling all over; 4/4: 3 total chicks in nest cluster 4/15: at least 5 branchlings between 483, 485, 487, 489 4/20: branchlings present for this cluster" +2023,6th_bridge,487,whib,2023-03-01,,,,"3/28: 8 total chicks in cluster, crawling all over; 4/4: 3 total chicks in nest cluster 4/15: at least 5 branchlings between 483, 485, 487, 489 4/20: branchlings present for this cluster" +2023,6th_bridge,487,whib,2023-03-08,,,,"3/28: 8 total chicks in cluster, crawling all over; 4/4: 3 total chicks in nest cluster 4/15: at least 5 branchlings between 483, 485, 487, 489 4/20: branchlings present for this cluster" +2023,6th_bridge,487,whib,2023-03-14,2,,incubating,"3/28: 8 total chicks in cluster, crawling all over; 4/4: 3 total chicks in nest cluster 4/15: at least 5 branchlings between 483, 485, 487, 489 4/20: branchlings present for this cluster" +2023,6th_bridge,487,whib,2023-03-21,,2,nestling,"3/28: 8 total chicks in cluster, crawling all over; 4/4: 3 total chicks in nest cluster 4/15: at least 5 branchlings between 483, 485, 487, 489 4/20: branchlings present for this cluster" +2023,6th_bridge,487,whib,2023-03-28,,2,nestling,"3/28: 8 total chicks in cluster, crawling all over; 4/4: 3 total chicks in nest cluster 4/15: at least 5 branchlings between 483, 485, 487, 489 4/20: branchlings present for this cluster" +2023,6th_bridge,487,whib,2023-04-04,,1,nestling,"3/28: 8 total chicks in cluster, crawling all over; 4/4: 3 total chicks in nest cluster 4/15: at least 5 branchlings between 483, 485, 487, 489 4/20: branchlings present for this cluster" +2023,6th_bridge,487,whib,2023-04-15,,,empty,"3/28: 8 total chicks in cluster, crawling all over; 4/4: 3 total chicks in nest cluster 4/15: at least 5 branchlings between 483, 485, 487, 489 4/20: branchlings present for this cluster" +2023,6th_bridge,487,whib,2023-04-20,,,pulled,"3/28: 8 total chicks in cluster, crawling all over; 4/4: 3 total chicks in nest cluster 4/15: at least 5 branchlings between 483, 485, 487, 489 4/20: branchlings present for this cluster" +2023,6th_bridge,487,whib,2023-04-27,,,,"3/28: 8 total chicks in cluster, crawling all over; 4/4: 3 total chicks in nest cluster 4/15: at least 5 branchlings between 483, 485, 487, 489 4/20: branchlings present for this cluster" +2023,6th_bridge,487,whib,2023-05-03,,,,"3/28: 8 total chicks in cluster, crawling all over; 4/4: 3 total chicks in nest cluster 4/15: at least 5 branchlings between 483, 485, 487, 489 4/20: branchlings present for this cluster" +2023,6th_bridge,489,whib,2023-02-22,,,,"3/14: high nest 3/28: 8 total chicks in cluster, crawling all over 4/15: at least 5 branchlings between 483, 485, 487, 489 4/20: branchlings present for this cluster" +2023,6th_bridge,489,whib,2023-03-01,,,,"3/14: high nest 3/28: 8 total chicks in cluster, crawling all over 4/15: at least 5 branchlings between 483, 485, 487, 489 4/20: branchlings present for this cluster" +2023,6th_bridge,489,whib,2023-03-08,,,,"3/14: high nest 3/28: 8 total chicks in cluster, crawling all over 4/15: at least 5 branchlings between 483, 485, 487, 489 4/20: branchlings present for this cluster" +2023,6th_bridge,489,whib,2023-03-14,2,,incubating,"3/14: high nest 3/28: 8 total chicks in cluster, crawling all over 4/15: at least 5 branchlings between 483, 485, 487, 489 4/20: branchlings present for this cluster" +2023,6th_bridge,489,whib,2023-03-21,,2,nestling,"3/14: high nest 3/28: 8 total chicks in cluster, crawling all over 4/15: at least 5 branchlings between 483, 485, 487, 489 4/20: branchlings present for this cluster" +2023,6th_bridge,489,whib,2023-03-28,,2,nestling,"3/14: high nest 3/28: 8 total chicks in cluster, crawling all over 4/15: at least 5 branchlings between 483, 485, 487, 489 4/20: branchlings present for this cluster" +2023,6th_bridge,489,whib,2023-04-04,,2,nestling,"3/14: high nest 3/28: 8 total chicks in cluster, crawling all over 4/15: at least 5 branchlings between 483, 485, 487, 489 4/20: branchlings present for this cluster" +2023,6th_bridge,489,whib,2023-04-15,,,empty,"3/14: high nest 3/28: 8 total chicks in cluster, crawling all over 4/15: at least 5 branchlings between 483, 485, 487, 489 4/20: branchlings present for this cluster" +2023,6th_bridge,489,whib,2023-04-20,,,pulled,"3/14: high nest 3/28: 8 total chicks in cluster, crawling all over 4/15: at least 5 branchlings between 483, 485, 487, 489 4/20: branchlings present for this cluster" +2023,6th_bridge,489,whib,2023-04-27,,,,"3/14: high nest 3/28: 8 total chicks in cluster, crawling all over 4/15: at least 5 branchlings between 483, 485, 487, 489 4/20: branchlings present for this cluster" +2023,6th_bridge,489,whib,2023-05-03,,,,"3/14: high nest 3/28: 8 total chicks in cluster, crawling all over 4/15: at least 5 branchlings between 483, 485, 487, 489 4/20: branchlings present for this cluster" +2023,6th_bridge,491,whib,2023-02-22,,,,"4/15: at least one branchling between 491 and 493" +2023,6th_bridge,491,whib,2023-03-01,,,,"4/15: at least one branchling between 491 and 493" +2023,6th_bridge,491,whib,2023-03-08,,,,"4/15: at least one branchling between 491 and 493" +2023,6th_bridge,491,whib,2023-03-14,2,,incubating,"4/15: at least one branchling between 491 and 493" +2023,6th_bridge,491,whib,2023-03-21,,2,nestling,"4/15: at least one branchling between 491 and 493" +2023,6th_bridge,491,whib,2023-03-28,,2,nestling,"4/15: at least one branchling between 491 and 493" +2023,6th_bridge,491,whib,2023-04-04,,2,nestling,"4/15: at least one branchling between 491 and 493" +2023,6th_bridge,491,whib,2023-04-15,,,empty,"4/15: at least one branchling between 491 and 493" +2023,6th_bridge,491,whib,2023-04-20,,,pulled,"4/15: at least one branchling between 491 and 493" +2023,6th_bridge,491,whib,2023-04-27,,,,"4/15: at least one branchling between 491 and 493" +2023,6th_bridge,491,whib,2023-05-03,,,,"4/15: at least one branchling between 491 and 493" +2023,6th_bridge,493,whib,2023-02-22,,,,"4/15: at least one branchling between 491 and 493" +2023,6th_bridge,493,whib,2023-03-01,,,,"4/15: at least one branchling between 491 and 493" +2023,6th_bridge,493,whib,2023-03-08,,,,"4/15: at least one branchling between 491 and 493" +2023,6th_bridge,493,whib,2023-03-14,2,,incubating,"4/15: at least one branchling between 491 and 493" +2023,6th_bridge,493,whib,2023-03-21,,1,nestling,"4/15: at least one branchling between 491 and 493" +2023,6th_bridge,493,whib,2023-03-28,,1,nestling,"4/15: at least one branchling between 491 and 493" +2023,6th_bridge,493,whib,2023-04-04,,1,nestling,"4/15: at least one branchling between 491 and 493" +2023,6th_bridge,493,whib,2023-04-15,,,empty,"4/15: at least one branchling between 491 and 493" +2023,6th_bridge,493,whib,2023-04-20,,,pulled,"4/15: at least one branchling between 491 and 493" +2023,6th_bridge,493,whib,2023-04-27,,,,"4/15: at least one branchling between 491 and 493" +2023,6th_bridge,493,whib,2023-05-03,,,,"4/15: at least one branchling between 491 and 493" +2023,6th_bridge,528,bcnh,2023-02-22,,,,"3/28: broken eggshell on the ground; 4/4: broken egg" +2023,6th_bridge,528,bcnh,2023-03-01,,,,"3/28: broken eggshell on the ground; 4/4: broken egg" +2023,6th_bridge,528,bcnh,2023-03-08,,,,"3/28: broken eggshell on the ground; 4/4: broken egg" +2023,6th_bridge,528,bcnh,2023-03-14,,,,"3/28: broken eggshell on the ground; 4/4: broken egg" +2023,6th_bridge,528,bcnh,2023-03-21,1,,incubating,"3/28: broken eggshell on the ground; 4/4: broken egg" +2023,6th_bridge,528,bcnh,2023-03-28,1,,incubating,"3/28: broken eggshell on the ground; 4/4: broken egg" +2023,6th_bridge,528,bcnh,2023-04-04,,,empty,"3/28: broken eggshell on the ground; 4/4: broken egg" +2023,6th_bridge,528,bcnh,2023-04-15,,,,"3/28: broken eggshell on the ground; 4/4: broken egg" +2023,6th_bridge,528,bcnh,2023-04-20,,,pulled,"3/28: broken eggshell on the ground; 4/4: broken egg" +2023,6th_bridge,528,bcnh,2023-04-27,,,,"3/28: broken eggshell on the ground; 4/4: broken egg" +2023,6th_bridge,528,bcnh,2023-05-03,,,,"3/28: broken eggshell on the ground; 4/4: broken egg" +2023,6th_bridge,455,bcnh,2023-02-22,,,, +2023,6th_bridge,455,bcnh,2023-03-01,,,, +2023,6th_bridge,455,bcnh,2023-03-08,,,, +2023,6th_bridge,455,bcnh,2023-03-14,3,,incubating, +2023,6th_bridge,455,bcnh,2023-03-21,,3,nestling, +2023,6th_bridge,455,bcnh,2023-03-28,,2,nestling, +2023,6th_bridge,455,bcnh,2023-04-04,,,empty, +2023,6th_bridge,455,bcnh,2023-04-15,,,empty, +2023,6th_bridge,455,bcnh,2023-04-20,,,pulled, +2023,6th_bridge,455,bcnh,2023-04-27,,,, +2023,6th_bridge,455,bcnh,2023-05-03,,,, +2023,6th_bridge,459,bcnh,2023-02-22,,,,"4/4: dead egg" +2023,6th_bridge,459,bcnh,2023-03-01,,,,"4/4: dead egg" +2023,6th_bridge,459,bcnh,2023-03-08,,,,"4/4: dead egg" +2023,6th_bridge,459,bcnh,2023-03-14,3,,incubating,"4/4: dead egg" +2023,6th_bridge,459,bcnh,2023-03-21,1,2,hatching,"4/4: dead egg" +2023,6th_bridge,459,bcnh,2023-03-28,1,1,hatching,"4/4: dead egg" +2023,6th_bridge,459,bcnh,2023-04-04,,,empty,"4/4: dead egg" +2023,6th_bridge,459,bcnh,2023-04-15,,,,"4/4: dead egg" +2023,6th_bridge,459,bcnh,2023-04-20,,,pulled,"4/4: dead egg" +2023,6th_bridge,459,bcnh,2023-04-27,,,,"4/4: dead egg" +2023,6th_bridge,459,bcnh,2023-05-03,,,,"4/4: dead egg" +2023,6th_bridge,516,smwh,2023-02-22,,,,"4/15: one live chick and one dead chick 4/20: dead chick in nest, chick alive on 4/15 likely dead now" +2023,6th_bridge,516,smwh,2023-03-01,,,,"4/15: one live chick and one dead chick 4/20: dead chick in nest, chick alive on 4/15 likely dead now" +2023,6th_bridge,516,smwh,2023-03-08,,,,"4/15: one live chick and one dead chick 4/20: dead chick in nest, chick alive on 4/15 likely dead now" +2023,6th_bridge,516,smwh,2023-03-14,,,,"4/15: one live chick and one dead chick 4/20: dead chick in nest, chick alive on 4/15 likely dead now" +2023,6th_bridge,516,smwh,2023-03-21,3,,incubating,"4/15: one live chick and one dead chick 4/20: dead chick in nest, chick alive on 4/15 likely dead now" +2023,6th_bridge,516,smwh,2023-03-28,3,,incubating,"4/15: one live chick and one dead chick 4/20: dead chick in nest, chick alive on 4/15 likely dead now" +2023,6th_bridge,516,smwh,2023-04-04,1,2,chick_dry,"4/15: one live chick and one dead chick 4/20: dead chick in nest, chick alive on 4/15 likely dead now" +2023,6th_bridge,516,smwh,2023-04-15,,1,nestling,"4/15: one live chick and one dead chick 4/20: dead chick in nest, chick alive on 4/15 likely dead now" +2023,6th_bridge,516,smwh,2023-04-20,,,empty,"4/15: one live chick and one dead chick 4/20: dead chick in nest, chick alive on 4/15 likely dead now" +2023,6th_bridge,516,smwh,2023-04-27,,,,"4/15: one live chick and one dead chick 4/20: dead chick in nest, chick alive on 4/15 likely dead now" +2023,6th_bridge,516,smwh,2023-05-03,,,,"4/15: one live chick and one dead chick 4/20: dead chick in nest, chick alive on 4/15 likely dead now" +2023,6th_bridge,526,smhe,2023-02-22,,,,"3/21: barely a nest 3/28: nest gone; 4/4: flag pulled" +2023,6th_bridge,526,smhe,2023-03-01,,,,"3/21: barely a nest 3/28: nest gone; 4/4: flag pulled" +2023,6th_bridge,526,smhe,2023-03-08,,,,"3/21: barely a nest 3/28: nest gone; 4/4: flag pulled" +2023,6th_bridge,526,smhe,2023-03-14,,,,"3/21: barely a nest 3/28: nest gone; 4/4: flag pulled" +2023,6th_bridge,526,smhe,2023-03-21,1,,incubating,"3/21: barely a nest 3/28: nest gone; 4/4: flag pulled" +2023,6th_bridge,526,smhe,2023-03-28,,,empty,"3/21: barely a nest 3/28: nest gone; 4/4: flag pulled" +2023,6th_bridge,526,smhe,2023-04-04,,,pulled,"3/21: barely a nest 3/28: nest gone; 4/4: flag pulled" +2023,6th_bridge,526,smhe,2023-04-15,,,,"3/21: barely a nest 3/28: nest gone; 4/4: flag pulled" +2023,6th_bridge,526,smhe,2023-04-20,,,,"3/21: barely a nest 3/28: nest gone; 4/4: flag pulled" +2023,6th_bridge,526,smhe,2023-04-27,,,,"3/21: barely a nest 3/28: nest gone; 4/4: flag pulled" +2023,6th_bridge,526,smhe,2023-05-03,,,,"3/21: barely a nest 3/28: nest gone; 4/4: flag pulled" +2023,6th_bridge,602,glib,2023-02-22,,,,"4/20: flag pulled" +2023,6th_bridge,602,glib,2023-03-01,,,,"4/20: flag pulled" +2023,6th_bridge,602,glib,2023-03-08,,,,"4/20: flag pulled" +2023,6th_bridge,602,glib,2023-03-14,,,,"4/20: flag pulled" +2023,6th_bridge,602,glib,2023-03-21,,,,"4/20: flag pulled" +2023,6th_bridge,602,glib,2023-03-28,3,,incubating,"4/20: flag pulled" +2023,6th_bridge,602,glib,2023-04-04,3,,incubating,"4/20: flag pulled" +2023,6th_bridge,602,glib,2023-04-15,1,2,hatching,"4/20: flag pulled" +2023,6th_bridge,602,glib,2023-04-20,,,empty,"4/20: flag pulled" +2023,6th_bridge,602,glib,2023-04-27,,,,"4/20: flag pulled" +2023,6th_bridge,602,glib,2023-05-03,,,,"4/20: flag pulled" +2023,6th_bridge,604,smhe,2023-02-22,,,,"4/15: nest looks wet 4/20: eggs broken, flag pulled" +2023,6th_bridge,604,smhe,2023-03-01,,,,"4/15: nest looks wet 4/20: eggs broken, flag pulled" +2023,6th_bridge,604,smhe,2023-03-08,,,,"4/15: nest looks wet 4/20: eggs broken, flag pulled" +2023,6th_bridge,604,smhe,2023-03-14,,,,"4/15: nest looks wet 4/20: eggs broken, flag pulled" +2023,6th_bridge,604,smhe,2023-03-21,,,,"4/15: nest looks wet 4/20: eggs broken, flag pulled" +2023,6th_bridge,604,smhe,2023-03-28,1,,incubating,"4/15: nest looks wet 4/20: eggs broken, flag pulled" +2023,6th_bridge,604,smhe,2023-04-04,3,,incubating,"4/15: nest looks wet 4/20: eggs broken, flag pulled" +2023,6th_bridge,604,smhe,2023-04-15,3,,incubating,"4/15: nest looks wet 4/20: eggs broken, flag pulled" +2023,6th_bridge,604,smhe,2023-04-20,,,empty,"4/15: nest looks wet 4/20: eggs broken, flag pulled" +2023,6th_bridge,604,smhe,2023-04-27,,,,"4/15: nest looks wet 4/20: eggs broken, flag pulled" +2023,6th_bridge,604,smhe,2023-05-03,,,,"4/15: nest looks wet 4/20: eggs broken, flag pulled" +2023,6th_bridge,606,glib,2023-02-22,,,,"4/15: 2-3 days old 4/20: flag pulled" +2023,6th_bridge,606,glib,2023-03-01,,,,"4/15: 2-3 days old 4/20: flag pulled" +2023,6th_bridge,606,glib,2023-03-08,,,,"4/15: 2-3 days old 4/20: flag pulled" +2023,6th_bridge,606,glib,2023-03-14,,,,"4/15: 2-3 days old 4/20: flag pulled" +2023,6th_bridge,606,glib,2023-03-21,,,,"4/15: 2-3 days old 4/20: flag pulled" +2023,6th_bridge,606,glib,2023-03-28,3,,incubating,"4/15: 2-3 days old 4/20: flag pulled" +2023,6th_bridge,606,glib,2023-04-04,3,,incubating,"4/15: 2-3 days old 4/20: flag pulled" +2023,6th_bridge,606,glib,2023-04-15,,3,nestling,"4/15: 2-3 days old 4/20: flag pulled" +2023,6th_bridge,606,glib,2023-04-20,,,empty,"4/15: 2-3 days old 4/20: flag pulled" +2023,6th_bridge,606,glib,2023-04-27,,,,"4/15: 2-3 days old 4/20: flag pulled" +2023,6th_bridge,606,glib,2023-05-03,,,,"4/15: 2-3 days old 4/20: flag pulled" +2023,6th_bridge,608,glib,2023-02-22,,,, +2023,6th_bridge,608,glib,2023-03-01,,,, +2023,6th_bridge,608,glib,2023-03-08,,,, +2023,6th_bridge,608,glib,2023-03-14,,,, +2023,6th_bridge,608,glib,2023-03-21,,,, +2023,6th_bridge,608,glib,2023-03-28,3,,incubating, +2023,6th_bridge,608,glib,2023-04-04,,,missed, +2023,6th_bridge,608,glib,2023-04-15,,,empty, +2023,6th_bridge,608,glib,2023-04-20,,,pulled, +2023,6th_bridge,608,glib,2023-04-27,,,, +2023,6th_bridge,608,glib,2023-05-03,,,, +2023,6th_bridge,610,glib,2023-02-22,,,,"4/20: flag pulled, eggs broken" +2023,6th_bridge,610,glib,2023-03-01,,,,"4/20: flag pulled, eggs broken" +2023,6th_bridge,610,glib,2023-03-08,,,,"4/20: flag pulled, eggs broken" +2023,6th_bridge,610,glib,2023-03-14,,,,"4/20: flag pulled, eggs broken" +2023,6th_bridge,610,glib,2023-03-21,,,,"4/20: flag pulled, eggs broken" +2023,6th_bridge,610,glib,2023-03-28,2,,incubating,"4/20: flag pulled, eggs broken" +2023,6th_bridge,610,glib,2023-04-04,3,,incubating,"4/20: flag pulled, eggs broken" +2023,6th_bridge,610,glib,2023-04-15,,,missed,"4/20: flag pulled, eggs broken" +2023,6th_bridge,610,glib,2023-04-20,,,empty,"4/20: flag pulled, eggs broken" +2023,6th_bridge,610,glib,2023-04-27,,,,"4/20: flag pulled, eggs broken" +2023,6th_bridge,610,glib,2023-05-03,,,,"4/20: flag pulled, eggs broken" +2023,6th_bridge,612,glib,2023-02-22,,,,"4/20: flag pulled, eggs broken" +2023,6th_bridge,612,glib,2023-03-01,,,,"4/20: flag pulled, eggs broken" +2023,6th_bridge,612,glib,2023-03-08,,,,"4/20: flag pulled, eggs broken" +2023,6th_bridge,612,glib,2023-03-14,,,,"4/20: flag pulled, eggs broken" +2023,6th_bridge,612,glib,2023-03-21,,,,"4/20: flag pulled, eggs broken" +2023,6th_bridge,612,glib,2023-03-28,1,,incubating,"4/20: flag pulled, eggs broken" +2023,6th_bridge,612,glib,2023-04-04,3,,incubating,"4/20: flag pulled, eggs broken" +2023,6th_bridge,612,glib,2023-04-15,,,empty,"4/20: flag pulled, eggs broken" +2023,6th_bridge,612,glib,2023-04-20,,,pulled,"4/20: flag pulled, eggs broken" +2023,6th_bridge,612,glib,2023-04-27,,,,"4/20: flag pulled, eggs broken" +2023,6th_bridge,612,glib,2023-05-03,,,,"4/20: flag pulled, eggs broken" +2023,jerrod,49,greg,2023-02-21,2,,incubating,"3/7: Missed, nest not on newest transect 3/30: nest gone, pink paper" +2023,jerrod,49,greg,2023-02-28,,,missed,"3/7: Missed, nest not on newest transect 3/30: nest gone, pink paper" +2023,jerrod,49,greg,2023-03-07,,,missed,"3/7: Missed, nest not on newest transect 3/30: nest gone, pink paper" +2023,jerrod,49,greg,2023-03-15,,,missed,"3/7: Missed, nest not on newest transect 3/30: nest gone, pink paper" +2023,jerrod,49,greg,2023-03-30,,,empty,"3/7: Missed, nest not on newest transect 3/30: nest gone, pink paper" +2023,jerrod,51,greg,2023-02-21,3,,incubating,"3/30: nest gone, blue paper" +2023,jerrod,51,greg,2023-02-28,,,missed,"3/30: nest gone, blue paper" +2023,jerrod,51,greg,2023-03-07,,,empty,"3/30: nest gone, blue paper" +2023,jerrod,51,greg,2023-03-15,,,,"3/30: nest gone, blue paper" +2023,jerrod,51,greg,2023-03-30,,,,"3/30: nest gone, blue paper" +2023,jerrod,94,greg,2023-02-21,2,,incubating,"3/30: eggshell in nest, orange paper" +2023,jerrod,94,greg,2023-02-28,,,missed,"3/30: eggshell in nest, orange paper" +2023,jerrod,94,greg,2023-03-07,2,,incubating,"3/30: eggshell in nest, orange paper" +2023,jerrod,94,greg,2023-03-15,2,,incubating,"3/30: eggshell in nest, orange paper" +2023,jerrod,94,greg,2023-03-30,,,empty,"3/30: eggshell in nest, orange paper" +2023,jerrod,53,gbhe,2023-02-21,1,,incubating,"3/7: 2 eggshells on ground 3/30: orange paper wrapped around branch, and a piece on cattail lower down" +2023,jerrod,53,gbhe,2023-02-28,,,missed,"3/7: 2 eggshells on ground 3/30: orange paper wrapped around branch, and a piece on cattail lower down" +2023,jerrod,53,gbhe,2023-03-07,,,empty,"3/7: 2 eggshells on ground 3/30: orange paper wrapped around branch, and a piece on cattail lower down" +2023,jerrod,53,gbhe,2023-03-15,,,,"3/7: 2 eggshells on ground 3/30: orange paper wrapped around branch, and a piece on cattail lower down" +2023,jerrod,53,gbhe,2023-03-30,,,,"3/7: 2 eggshells on ground 3/30: orange paper wrapped around branch, and a piece on cattail lower down" +2023,jerrod,55,greg,2023-02-21,2,,incubating,"3/7: 2 eggshells on ground 3/30: blue paper" +2023,jerrod,55,greg,2023-02-28,,,missed,"3/7: 2 eggshells on ground 3/30: blue paper" +2023,jerrod,55,greg,2023-03-07,,,empty,"3/7: 2 eggshells on ground 3/30: blue paper" +2023,jerrod,55,greg,2023-03-15,,,,"3/7: 2 eggshells on ground 3/30: blue paper" +2023,jerrod,55,greg,2023-03-30,,,,"3/7: 2 eggshells on ground 3/30: blue paper" +2023,jerrod,82,greg,2023-02-21,,,,"3/30: blue paper" +2023,jerrod,82,greg,2023-02-28,2,,incubating,"3/30: blue paper" +2023,jerrod,82,greg,2023-03-07,2,,incubating,"3/30: blue paper" +2023,jerrod,82,greg,2023-03-15,,,empty,"3/30: blue paper" +2023,jerrod,82,greg,2023-03-30,,,,"3/30: blue paper" +2023,jerrod,80,greg,2023-02-21,,,,"3/7: eggshells on ground 3/30: pink paper" +2023,jerrod,80,greg,2023-02-28,3,,incubating,"3/7: eggshells on ground 3/30: pink paper" +2023,jerrod,80,greg,2023-03-07,,,empty,"3/7: eggshells on ground 3/30: pink paper" +2023,jerrod,80,greg,2023-03-15,,,,"3/7: eggshells on ground 3/30: pink paper" +2023,jerrod,80,greg,2023-03-30,,,,"3/7: eggshells on ground 3/30: pink paper" +2023,jerrod,228,greg,2023-02-21,,,,"2/28: nest a little ways off transect 3/30: orange paper" +2023,jerrod,228,greg,2023-02-28,2,,incubating,"2/28: nest a little ways off transect 3/30: orange paper" +2023,jerrod,228,greg,2023-03-07,,,empty,"2/28: nest a little ways off transect 3/30: orange paper" +2023,jerrod,228,greg,2023-03-15,,,,"2/28: nest a little ways off transect 3/30: orange paper" +2023,jerrod,228,greg,2023-03-30,,,,"2/28: nest a little ways off transect 3/30: orange paper" +2023,jerrod,230,greg,2023-02-21,,,,"2/28: 2 nests in row off trail, careful of branches 3/30: yellow paper" +2023,jerrod,230,greg,2023-02-28,3,,incubating,"2/28: 2 nests in row off trail, careful of branches 3/30: yellow paper" +2023,jerrod,230,greg,2023-03-07,4,,incubating,"2/28: 2 nests in row off trail, careful of branches 3/30: yellow paper" +2023,jerrod,230,greg,2023-03-15,,,empty,"2/28: 2 nests in row off trail, careful of branches 3/30: yellow paper" +2023,jerrod,230,greg,2023-03-30,,,,"2/28: 2 nests in row off trail, careful of branches 3/30: yellow paper" +2023,jerrod,232,greg,2023-02-21,,,,"3/30: blue paper" +2023,jerrod,232,greg,2023-02-28,2,,incubating,"3/30: blue paper" +2023,jerrod,232,greg,2023-03-07,2,,incubating,"3/30: blue paper" +2023,jerrod,232,greg,2023-03-15,,,empty,"3/30: blue paper" +2023,jerrod,232,greg,2023-03-30,,,,"3/30: blue paper" +2023,jerrod,263,greg,2023-02-21,,,,"3/7: 2nd chick currently hatching, out of egg @8:43 am 3/30: biggest chick mercury sampled" +2023,jerrod,263,greg,2023-02-28,3,,incubating,"3/7: 2nd chick currently hatching, out of egg @8:43 am 3/30: biggest chick mercury sampled" +2023,jerrod,263,greg,2023-03-07,1,2,wet_chick,"3/7: 2nd chick currently hatching, out of egg @8:43 am 3/30: biggest chick mercury sampled" +2023,jerrod,263,greg,2023-03-15,,3,nestling,"3/7: 2nd chick currently hatching, out of egg @8:43 am 3/30: biggest chick mercury sampled" +2023,jerrod,263,greg,2023-03-30,,2,nestling,"3/7: 2nd chick currently hatching, out of egg @8:43 am 3/30: biggest chick mercury sampled" +2023,jerrod,265,gbhe,2023-02-21,,,,"3/15: eggshells on ground, 2 at least 3/30: pink paper attached to two nearby willows, about 3m away from nest" +2023,jerrod,265,gbhe,2023-02-28,3,,incubating,"3/15: eggshells on ground, 2 at least 3/30: pink paper attached to two nearby willows, about 3m away from nest" +2023,jerrod,265,gbhe,2023-03-07,3,,incubating,"3/15: eggshells on ground, 2 at least 3/30: pink paper attached to two nearby willows, about 3m away from nest" +2023,jerrod,265,gbhe,2023-03-15,,,empty,"3/15: eggshells on ground, 2 at least 3/30: pink paper attached to two nearby willows, about 3m away from nest" +2023,jerrod,265,gbhe,2023-03-30,,,,"3/15: eggshells on ground, 2 at least 3/30: pink paper attached to two nearby willows, about 3m away from nest" +2023,jerrod,234,greg,2023-02-21,,,, +2023,jerrod,234,greg,2023-02-28,2,,incubating, +2023,jerrod,234,greg,2023-03-07,2,,incubating, +2023,jerrod,234,greg,2023-03-15,1,1,chick_dry, +2023,jerrod,234,greg,2023-03-30,,1,nestling, +2023,jerrod,261,greg,2023-02-21,,,,"3/30: biggest chick sampled for mercury" +2023,jerrod,261,greg,2023-02-28,2,,incubating,"3/30: biggest chick sampled for mercury" +2023,jerrod,261,greg,2023-03-07,2,,incubating,"3/30: biggest chick sampled for mercury" +2023,jerrod,261,greg,2023-03-15,,2,chick_dry,"3/30: biggest chick sampled for mercury" +2023,jerrod,261,greg,2023-03-30,,2,nestling,"3/30: biggest chick sampled for mercury" +2023,jerrod,267,greg,2023-02-21,,,,"2/28: to left of path, right by 261 3/30: orange paper" +2023,jerrod,267,greg,2023-02-28,1,,incubating,"2/28: to left of path, right by 261 3/30: orange paper" +2023,jerrod,267,greg,2023-03-07,,1,chick_dry,"2/28: to left of path, right by 261 3/30: orange paper" +2023,jerrod,267,greg,2023-03-15,,,empty,"2/28: to left of path, right by 261 3/30: orange paper" +2023,jerrod,267,greg,2023-03-30,,,,"2/28: to left of path, right by 261 3/30: orange paper" +2023,hidden,1,greg,2023-02-16,3,,incubating,"3/9: 3 chicks certain 3/16: certain only 2 chicks 3/29: 2nd chick dead 4/14: Big chick 4/21: pulled flag" +2023,hidden,1,greg,2023-02-23,3,,incubating,"3/9: 3 chicks certain 3/16: certain only 2 chicks 3/29: 2nd chick dead 4/14: Big chick 4/21: pulled flag" +2023,hidden,1,greg,2023-03-02,,3,nestling,"3/9: 3 chicks certain 3/16: certain only 2 chicks 3/29: 2nd chick dead 4/14: Big chick 4/21: pulled flag" +2023,hidden,1,greg,2023-03-09,,3,nestling,"3/9: 3 chicks certain 3/16: certain only 2 chicks 3/29: 2nd chick dead 4/14: Big chick 4/21: pulled flag" +2023,hidden,1,greg,2023-03-16,,2,nestling,"3/9: 3 chicks certain 3/16: certain only 2 chicks 3/29: 2nd chick dead 4/14: Big chick 4/21: pulled flag" +2023,hidden,1,greg,2023-03-23,,2,nestling,"3/9: 3 chicks certain 3/16: certain only 2 chicks 3/29: 2nd chick dead 4/14: Big chick 4/21: pulled flag" +2023,hidden,1,greg,2023-03-29,,1,nestling,"3/9: 3 chicks certain 3/16: certain only 2 chicks 3/29: 2nd chick dead 4/14: Big chick 4/21: pulled flag" +2023,hidden,1,greg,2023-04-06,,1,nestling,"3/9: 3 chicks certain 3/16: certain only 2 chicks 3/29: 2nd chick dead 4/14: Big chick 4/21: pulled flag" +2023,hidden,1,greg,2023-04-14,,1,nestling,"3/9: 3 chicks certain 3/16: certain only 2 chicks 3/29: 2nd chick dead 4/14: Big chick 4/21: pulled flag" +2023,hidden,1,greg,2023-04-21,,,empty,"3/9: 3 chicks certain 3/16: certain only 2 chicks 3/29: 2nd chick dead 4/14: Big chick 4/21: pulled flag" +2023,hidden,1,greg,2023-04-28,,,,"3/9: 3 chicks certain 3/16: certain only 2 chicks 3/29: 2nd chick dead 4/14: Big chick 4/21: pulled flag" +2023,hidden,1,greg,2023-05-05,,,,"3/9: 3 chicks certain 3/16: certain only 2 chicks 3/29: 2nd chick dead 4/14: Big chick 4/21: pulled flag" +2023,hidden,2,greg,2023-02-16,2,,incubating,"3/2: pulled flag" +2023,hidden,2,greg,2023-02-23,,,empty,"3/2: pulled flag" +2023,hidden,2,greg,2023-03-02,,,pulled,"3/2: pulled flag" +2023,hidden,2,greg,2023-03-09,,,,"3/2: pulled flag" +2023,hidden,2,greg,2023-03-16,,,,"3/2: pulled flag" +2023,hidden,2,greg,2023-03-23,,,,"3/2: pulled flag" +2023,hidden,2,greg,2023-03-29,,,,"3/2: pulled flag" +2023,hidden,2,greg,2023-04-06,,,,"3/2: pulled flag" +2023,hidden,2,greg,2023-04-14,,,,"3/2: pulled flag" +2023,hidden,2,greg,2023-04-21,,,,"3/2: pulled flag" +2023,hidden,2,greg,2023-04-28,,,,"3/2: pulled flag" +2023,hidden,2,greg,2023-05-05,,,,"3/2: pulled flag" +2023,hidden,3,greg,2023-02-16,2,,incubating,"3/9: two eggshells on ground 3/16: pulled flag, nest gone" +2023,hidden,3,greg,2023-02-23,2,,incubating,"3/9: two eggshells on ground 3/16: pulled flag, nest gone" +2023,hidden,3,greg,2023-03-02,,,empty,"3/9: two eggshells on ground 3/16: pulled flag, nest gone" +2023,hidden,3,greg,2023-03-09,,,empty,"3/9: two eggshells on ground 3/16: pulled flag, nest gone" +2023,hidden,3,greg,2023-03-16,,,pulled,"3/9: two eggshells on ground 3/16: pulled flag, nest gone" +2023,hidden,3,greg,2023-03-23,,,,"3/9: two eggshells on ground 3/16: pulled flag, nest gone" +2023,hidden,3,greg,2023-03-29,,,,"3/9: two eggshells on ground 3/16: pulled flag, nest gone" +2023,hidden,3,greg,2023-04-06,,,,"3/9: two eggshells on ground 3/16: pulled flag, nest gone" +2023,hidden,3,greg,2023-04-14,,,,"3/9: two eggshells on ground 3/16: pulled flag, nest gone" +2023,hidden,3,greg,2023-04-21,,,,"3/9: two eggshells on ground 3/16: pulled flag, nest gone" +2023,hidden,3,greg,2023-04-28,,,,"3/9: two eggshells on ground 3/16: pulled flag, nest gone" +2023,hidden,3,greg,2023-05-05,,,,"3/9: two eggshells on ground 3/16: pulled flag, nest gone" +2023,hidden,4,greg,2023-02-16,3,,incubating,"3/9: 3 chicks certain, 4/6: 1 chick dead in nest; 4/28: flag pulled" +2023,hidden,4,greg,2023-02-23,3,,incubating,"3/9: 3 chicks certain, 4/6: 1 chick dead in nest; 4/28: flag pulled" +2023,hidden,4,greg,2023-03-02,,2,nestling,"3/9: 3 chicks certain, 4/6: 1 chick dead in nest; 4/28: flag pulled" +2023,hidden,4,greg,2023-03-09,,3,nestling,"3/9: 3 chicks certain, 4/6: 1 chick dead in nest; 4/28: flag pulled" +2023,hidden,4,greg,2023-03-16,,3,nestling,"3/9: 3 chicks certain, 4/6: 1 chick dead in nest; 4/28: flag pulled" +2023,hidden,4,greg,2023-03-23,,2,nestling,"3/9: 3 chicks certain, 4/6: 1 chick dead in nest; 4/28: flag pulled" +2023,hidden,4,greg,2023-03-29,,2,nestling,"3/9: 3 chicks certain, 4/6: 1 chick dead in nest; 4/28: flag pulled" +2023,hidden,4,greg,2023-04-06,,1,nestling,"3/9: 3 chicks certain, 4/6: 1 chick dead in nest; 4/28: flag pulled" +2023,hidden,4,greg,2023-04-14,,1,nestling,"3/9: 3 chicks certain, 4/6: 1 chick dead in nest; 4/28: flag pulled" +2023,hidden,4,greg,2023-04-21,,,empty,"3/9: 3 chicks certain, 4/6: 1 chick dead in nest; 4/28: flag pulled" +2023,hidden,4,greg,2023-04-28,,,empty,"3/9: 3 chicks certain, 4/6: 1 chick dead in nest; 4/28: flag pulled" +2023,hidden,4,greg,2023-05-05,,,,"3/9: 3 chicks certain, 4/6: 1 chick dead in nest; 4/28: flag pulled" +2023,hidden,5,greg,2023-02-16,3,,incubating,"3/2: nest gone" +2023,hidden,5,greg,2023-02-23,3,,incubating,"3/2: nest gone" +2023,hidden,5,greg,2023-03-02,,,empty,"3/2: nest gone" +2023,hidden,5,greg,2023-03-09,,,pulled,"3/2: nest gone" +2023,hidden,5,greg,2023-03-16,,,,"3/2: nest gone" +2023,hidden,5,greg,2023-03-23,,,,"3/2: nest gone" +2023,hidden,5,greg,2023-03-29,,,,"3/2: nest gone" +2023,hidden,5,greg,2023-04-06,,,,"3/2: nest gone" +2023,hidden,5,greg,2023-04-14,,,,"3/2: nest gone" +2023,hidden,5,greg,2023-04-21,,,,"3/2: nest gone" +2023,hidden,5,greg,2023-04-28,,,,"3/2: nest gone" +2023,hidden,5,greg,2023-05-05,,,,"3/2: nest gone" +2023,hidden,6,greg,2023-02-16,3,,incubating,"3/16: 2 live chicks and 1 dead chick in nest; 3/29: 1 dead in nest, 1 dead on ground 4/6: pulled flag" +2023,hidden,6,greg,2023-02-23,3,,incubating,"3/16: 2 live chicks and 1 dead chick in nest; 3/29: 1 dead in nest, 1 dead on ground 4/6: pulled flag" +2023,hidden,6,greg,2023-03-02,3,,incubating,"3/16: 2 live chicks and 1 dead chick in nest; 3/29: 1 dead in nest, 1 dead on ground 4/6: pulled flag" +2023,hidden,6,greg,2023-03-09,3,,incubating,"3/16: 2 live chicks and 1 dead chick in nest; 3/29: 1 dead in nest, 1 dead on ground 4/6: pulled flag" +2023,hidden,6,greg,2023-03-16,,2,nestling,"3/16: 2 live chicks and 1 dead chick in nest; 3/29: 1 dead in nest, 1 dead on ground 4/6: pulled flag" +2023,hidden,6,greg,2023-03-23,,2,nestling,"3/16: 2 live chicks and 1 dead chick in nest; 3/29: 1 dead in nest, 1 dead on ground 4/6: pulled flag" +2023,hidden,6,greg,2023-03-29,,,empty,"3/16: 2 live chicks and 1 dead chick in nest; 3/29: 1 dead in nest, 1 dead on ground 4/6: pulled flag" +2023,hidden,6,greg,2023-04-06,,,pulled,"3/16: 2 live chicks and 1 dead chick in nest; 3/29: 1 dead in nest, 1 dead on ground 4/6: pulled flag" +2023,hidden,6,greg,2023-04-14,,,,"3/16: 2 live chicks and 1 dead chick in nest; 3/29: 1 dead in nest, 1 dead on ground 4/6: pulled flag" +2023,hidden,6,greg,2023-04-21,,,,"3/16: 2 live chicks and 1 dead chick in nest; 3/29: 1 dead in nest, 1 dead on ground 4/6: pulled flag" +2023,hidden,6,greg,2023-04-28,,,,"3/16: 2 live chicks and 1 dead chick in nest; 3/29: 1 dead in nest, 1 dead on ground 4/6: pulled flag" +2023,hidden,6,greg,2023-05-05,,,,"3/16: 2 live chicks and 1 dead chick in nest; 3/29: 1 dead in nest, 1 dead on ground 4/6: pulled flag" +2023,hidden,7,greg,2023-02-16,2,,incubating,"3/2: nest has ROSP eggs now, GREG eggs gone" +2023,hidden,7,greg,2023-02-23,3,,incubating,"3/2: nest has ROSP eggs now, GREG eggs gone" +2023,hidden,7,greg,2023-03-02,,,,"3/2: nest has ROSP eggs now, GREG eggs gone" +2023,hidden,7,greg,2023-03-09,,,,"3/2: nest has ROSP eggs now, GREG eggs gone" +2023,hidden,7,greg,2023-03-16,,,,"3/2: nest has ROSP eggs now, GREG eggs gone" +2023,hidden,7,greg,2023-03-23,,,,"3/2: nest has ROSP eggs now, GREG eggs gone" +2023,hidden,7,greg,2023-03-29,,,,"3/2: nest has ROSP eggs now, GREG eggs gone" +2023,hidden,7,greg,2023-04-06,,,,"3/2: nest has ROSP eggs now, GREG eggs gone" +2023,hidden,7,greg,2023-04-14,,,,"3/2: nest has ROSP eggs now, GREG eggs gone" +2023,hidden,7,greg,2023-04-21,,,,"3/2: nest has ROSP eggs now, GREG eggs gone" +2023,hidden,7,greg,2023-04-28,,,,"3/2: nest has ROSP eggs now, GREG eggs gone" +2023,hidden,7,greg,2023-05-05,,,,"3/2: nest has ROSP eggs now, GREG eggs gone" +2023,hidden,7*,rosp,2023-02-16,,,,"3/23: 2+ ROSP chicks; 3/29: 2 chicks certain" +2023,hidden,7*,rosp,2023-02-23,,,,"3/23: 2+ ROSP chicks; 3/29: 2 chicks certain" +2023,hidden,7*,rosp,2023-03-02,3,,incubating,"3/23: 2+ ROSP chicks; 3/29: 2 chicks certain" +2023,hidden,7*,rosp,2023-03-09,2,1,hatching,"3/23: 2+ ROSP chicks; 3/29: 2 chicks certain" +2023,hidden,7*,rosp,2023-03-16,,3,nestling,"3/23: 2+ ROSP chicks; 3/29: 2 chicks certain" +2023,hidden,7*,rosp,2023-03-23,,2,nestling,"3/23: 2+ ROSP chicks; 3/29: 2 chicks certain" +2023,hidden,7*,rosp,2023-03-29,,2,nestling,"3/23: 2+ ROSP chicks; 3/29: 2 chicks certain" +2023,hidden,7*,rosp,2023-04-06,,2,nestling,"3/23: 2+ ROSP chicks; 3/29: 2 chicks certain" +2023,hidden,7*,rosp,2023-04-14,,,empty,"3/23: 2+ ROSP chicks; 3/29: 2 chicks certain" +2023,hidden,7*,rosp,2023-04-21,,,empty,"3/23: 2+ ROSP chicks; 3/29: 2 chicks certain" +2023,hidden,7*,rosp,2023-04-28,,,,"3/23: 2+ ROSP chicks; 3/29: 2 chicks certain" +2023,hidden,7*,rosp,2023-05-05,,,,"3/23: 2+ ROSP chicks; 3/29: 2 chicks certain" +2023,hidden,8,greg,2023-02-16,2,,incubating,"3/29: 2nd chick dead 4/21: pulled flag" +2023,hidden,8,greg,2023-02-23,2,,incubating,"3/29: 2nd chick dead 4/21: pulled flag" +2023,hidden,8,greg,2023-03-02,1,1,hatching,"3/29: 2nd chick dead 4/21: pulled flag" +2023,hidden,8,greg,2023-03-09,,2,nestling,"3/29: 2nd chick dead 4/21: pulled flag" +2023,hidden,8,greg,2023-03-16,,2,nestling,"3/29: 2nd chick dead 4/21: pulled flag" +2023,hidden,8,greg,2023-03-23,,2,nestling,"3/29: 2nd chick dead 4/21: pulled flag" +2023,hidden,8,greg,2023-03-29,,1,nestling,"3/29: 2nd chick dead 4/21: pulled flag" +2023,hidden,8,greg,2023-04-06,,,empty,"3/29: 2nd chick dead 4/21: pulled flag" +2023,hidden,8,greg,2023-04-14,,1,nestling,"3/29: 2nd chick dead 4/21: pulled flag" +2023,hidden,8,greg,2023-04-21,,,empty,"3/29: 2nd chick dead 4/21: pulled flag" +2023,hidden,8,greg,2023-04-28,,,,"3/29: 2nd chick dead 4/21: pulled flag" +2023,hidden,8,greg,2023-05-05,,,,"3/29: 2nd chick dead 4/21: pulled flag" +2023,hidden,9,greg,2023-02-16,2,,incubating,"3/9: nest gone and flag pulled" +2023,hidden,9,greg,2023-02-23,2,,incubating,"3/9: nest gone and flag pulled" +2023,hidden,9,greg,2023-03-02,,,empty,"3/9: nest gone and flag pulled" +2023,hidden,9,greg,2023-03-09,,,pulled,"3/9: nest gone and flag pulled" +2023,hidden,9,greg,2023-03-16,,,,"3/9: nest gone and flag pulled" +2023,hidden,9,greg,2023-03-23,,,,"3/9: nest gone and flag pulled" +2023,hidden,9,greg,2023-03-29,,,,"3/9: nest gone and flag pulled" +2023,hidden,9,greg,2023-04-06,,,,"3/9: nest gone and flag pulled" +2023,hidden,9,greg,2023-04-14,,,,"3/9: nest gone and flag pulled" +2023,hidden,9,greg,2023-04-21,,,,"3/9: nest gone and flag pulled" +2023,hidden,9,greg,2023-04-28,,,,"3/9: nest gone and flag pulled" +2023,hidden,9,greg,2023-05-05,,,,"3/9: nest gone and flag pulled" +2023,hidden,10,greg,2023-02-16,3,,incubating,"3/2: one dry chick, and one halfway out of egg 3/23: 2+ GREG chicks" +2023,hidden,10,greg,2023-02-23,3,,incubating,"3/2: one dry chick, and one halfway out of egg 3/23: 2+ GREG chicks" +2023,hidden,10,greg,2023-03-02,2,1,hatching,"3/2: one dry chick, and one halfway out of egg 3/23: 2+ GREG chicks" +2023,hidden,10,greg,2023-03-09,,3,nestling,"3/2: one dry chick, and one halfway out of egg 3/23: 2+ GREG chicks" +2023,hidden,10,greg,2023-03-16,,3,nestling,"3/2: one dry chick, and one halfway out of egg 3/23: 2+ GREG chicks" +2023,hidden,10,greg,2023-03-23,,2,nestling,"3/2: one dry chick, and one halfway out of egg 3/23: 2+ GREG chicks" +2023,hidden,10,greg,2023-03-29,,2,nestling,"3/2: one dry chick, and one halfway out of egg 3/23: 2+ GREG chicks" +2023,hidden,10,greg,2023-04-06,,,empty,"3/2: one dry chick, and one halfway out of egg 3/23: 2+ GREG chicks" +2023,hidden,10,greg,2023-04-14,,,empty,"3/2: one dry chick, and one halfway out of egg 3/23: 2+ GREG chicks" +2023,hidden,10,greg,2023-04-21,,,pulled,"3/2: one dry chick, and one halfway out of egg 3/23: 2+ GREG chicks" +2023,hidden,10,greg,2023-04-28,,,,"3/2: one dry chick, and one halfway out of egg 3/23: 2+ GREG chicks" +2023,hidden,10,greg,2023-05-05,,,,"3/2: one dry chick, and one halfway out of egg 3/23: 2+ GREG chicks" +2023,hidden,11,greg,2023-02-16,2,,incubating,"3/2: pulled flag, nest gone" +2023,hidden,11,greg,2023-02-23,,,empty,"3/2: pulled flag, nest gone" +2023,hidden,11,greg,2023-03-02,,,empty,"3/2: pulled flag, nest gone" +2023,hidden,11,greg,2023-03-09,,,pulled,"3/2: pulled flag, nest gone" +2023,hidden,11,greg,2023-03-16,,,,"3/2: pulled flag, nest gone" +2023,hidden,11,greg,2023-03-23,,,,"3/2: pulled flag, nest gone" +2023,hidden,11,greg,2023-03-29,,,,"3/2: pulled flag, nest gone" +2023,hidden,11,greg,2023-04-06,,,,"3/2: pulled flag, nest gone" +2023,hidden,11,greg,2023-04-14,,,,"3/2: pulled flag, nest gone" +2023,hidden,11,greg,2023-04-21,,,,"3/2: pulled flag, nest gone" +2023,hidden,11,greg,2023-04-28,,,,"3/2: pulled flag, nest gone" +2023,hidden,11,greg,2023-05-05,,,,"3/2: pulled flag, nest gone" +2023,hidden,12,greg,2023-02-16,,2,nestling,"2/23: certain only one chick 3/9: nest gone, pulled flagging, dead chick found" +2023,hidden,12,greg,2023-02-23,,1,nestling,"2/23: certain only one chick 3/9: nest gone, pulled flagging, dead chick found" +2023,hidden,12,greg,2023-03-02,,1,nestling,"2/23: certain only one chick 3/9: nest gone, pulled flagging, dead chick found" +2023,hidden,12,greg,2023-03-09,,,empty,"2/23: certain only one chick 3/9: nest gone, pulled flagging, dead chick found" +2023,hidden,12,greg,2023-03-16,,,,"2/23: certain only one chick 3/9: nest gone, pulled flagging, dead chick found" +2023,hidden,12,greg,2023-03-23,,,,"2/23: certain only one chick 3/9: nest gone, pulled flagging, dead chick found" +2023,hidden,12,greg,2023-03-29,,,,"2/23: certain only one chick 3/9: nest gone, pulled flagging, dead chick found" +2023,hidden,12,greg,2023-04-06,,,,"2/23: certain only one chick 3/9: nest gone, pulled flagging, dead chick found" +2023,hidden,12,greg,2023-04-14,,,,"2/23: certain only one chick 3/9: nest gone, pulled flagging, dead chick found" +2023,hidden,12,greg,2023-04-21,,,,"2/23: certain only one chick 3/9: nest gone, pulled flagging, dead chick found" +2023,hidden,12,greg,2023-04-28,,,,"2/23: certain only one chick 3/9: nest gone, pulled flagging, dead chick found" +2023,hidden,12,greg,2023-05-05,,,,"2/23: certain only one chick 3/9: nest gone, pulled flagging, dead chick found" +2023,hidden,13,bcnh,2023-02-16,2,,incubating,"3/16: pulled flag, nest gone" +2023,hidden,13,bcnh,2023-02-23,2,,incubating,"3/16: pulled flag, nest gone" +2023,hidden,13,bcnh,2023-03-02,,2,chick_dry,"3/16: pulled flag, nest gone" +2023,hidden,13,bcnh,2023-03-09,,,empty,"3/16: pulled flag, nest gone" +2023,hidden,13,bcnh,2023-03-16,,,pulled,"3/16: pulled flag, nest gone" +2023,hidden,13,bcnh,2023-03-23,,,,"3/16: pulled flag, nest gone" +2023,hidden,13,bcnh,2023-03-29,,,,"3/16: pulled flag, nest gone" +2023,hidden,13,bcnh,2023-04-06,,,,"3/16: pulled flag, nest gone" +2023,hidden,13,bcnh,2023-04-14,,,,"3/16: pulled flag, nest gone" +2023,hidden,13,bcnh,2023-04-21,,,,"3/16: pulled flag, nest gone" +2023,hidden,13,bcnh,2023-04-28,,,,"3/16: pulled flag, nest gone" +2023,hidden,13,bcnh,2023-05-05,,,,"3/16: pulled flag, nest gone" +2023,hidden,14,rosp,2023-02-16,2,,incubating,"3/9: chick dry 3/23: 2 dead chicks in the nest; 3/29: pulled flag" +2023,hidden,14,rosp,2023-02-23,3,,incubating,"3/9: chick dry 3/23: 2 dead chicks in the nest; 3/29: pulled flag" +2023,hidden,14,rosp,2023-03-02,3,,incubating,"3/9: chick dry 3/23: 2 dead chicks in the nest; 3/29: pulled flag" +2023,hidden,14,rosp,2023-03-09,2,1,chick_dry,"3/9: chick dry 3/23: 2 dead chicks in the nest; 3/29: pulled flag" +2023,hidden,14,rosp,2023-03-16,,3,nestling,"3/9: chick dry 3/23: 2 dead chicks in the nest; 3/29: pulled flag" +2023,hidden,14,rosp,2023-03-23,,,empty,"3/9: chick dry 3/23: 2 dead chicks in the nest; 3/29: pulled flag" +2023,hidden,14,rosp,2023-03-29,,,pulled,"3/9: chick dry 3/23: 2 dead chicks in the nest; 3/29: pulled flag" +2023,hidden,14,rosp,2023-04-06,,,,"3/9: chick dry 3/23: 2 dead chicks in the nest; 3/29: pulled flag" +2023,hidden,14,rosp,2023-04-14,,,,"3/9: chick dry 3/23: 2 dead chicks in the nest; 3/29: pulled flag" +2023,hidden,14,rosp,2023-04-21,,,,"3/9: chick dry 3/23: 2 dead chicks in the nest; 3/29: pulled flag" +2023,hidden,14,rosp,2023-04-28,,,,"3/9: chick dry 3/23: 2 dead chicks in the nest; 3/29: pulled flag" +2023,hidden,14,rosp,2023-05-05,,,,"3/9: chick dry 3/23: 2 dead chicks in the nest; 3/29: pulled flag" +2023,hidden,16,greg,2023-02-16,2,,incubating,"3/29: pulled flag" +2023,hidden,16,greg,2023-02-23,2,,incubating,"3/29: pulled flag" +2023,hidden,16,greg,2023-03-02,2,,incubating,"3/29: pulled flag" +2023,hidden,16,greg,2023-03-09,2,,incubating,"3/29: pulled flag" +2023,hidden,16,greg,2023-03-16,,2,nestling,"3/29: pulled flag" +2023,hidden,16,greg,2023-03-23,,2,nestling,"3/29: pulled flag" +2023,hidden,16,greg,2023-03-29,,,empty,"3/29: pulled flag" +2023,hidden,16,greg,2023-04-06,,,,"3/29: pulled flag" +2023,hidden,16,greg,2023-04-14,,,,"3/29: pulled flag" +2023,hidden,16,greg,2023-04-21,,,,"3/29: pulled flag" +2023,hidden,16,greg,2023-04-28,,,,"3/29: pulled flag" +2023,hidden,16,greg,2023-05-05,,,,"3/29: pulled flag" +2023,hidden,18,greg,2023-02-16,1,,incubating,"3/9: nest gone and flag pulled" +2023,hidden,18,greg,2023-02-23,2,,incubating,"3/9: nest gone and flag pulled" +2023,hidden,18,greg,2023-03-02,2,,incubating,"3/9: nest gone and flag pulled" +2023,hidden,18,greg,2023-03-09,,,empty,"3/9: nest gone and flag pulled" +2023,hidden,18,greg,2023-03-16,,,,"3/9: nest gone and flag pulled" +2023,hidden,18,greg,2023-03-23,,,,"3/9: nest gone and flag pulled" +2023,hidden,18,greg,2023-03-29,,,,"3/9: nest gone and flag pulled" +2023,hidden,18,greg,2023-04-06,,,,"3/9: nest gone and flag pulled" +2023,hidden,18,greg,2023-04-14,,,,"3/9: nest gone and flag pulled" +2023,hidden,18,greg,2023-04-21,,,,"3/9: nest gone and flag pulled" +2023,hidden,18,greg,2023-04-28,,,,"3/9: nest gone and flag pulled" +2023,hidden,18,greg,2023-05-05,,,,"3/9: nest gone and flag pulled" +2023,hidden,20,bcnh,2023-02-16,3,,incubating,"2/16: possible bcnh 3/9: possibly 3 chicks, not 2 3/16: some eggshell in nest 3/23: all chicks in the nest dead, uncertain of total number of chicks; 3/29: one dead egg still in nestcup, flag pulled" +2023,hidden,20,bcnh,2023-02-23,3,,incubating,"2/16: possible bcnh 3/9: possibly 3 chicks, not 2 3/16: some eggshell in nest 3/23: all chicks in the nest dead, uncertain of total number of chicks; 3/29: one dead egg still in nestcup, flag pulled" +2023,hidden,20,bcnh,2023-03-02,1,2,hatching,"2/16: possible bcnh 3/9: possibly 3 chicks, not 2 3/16: some eggshell in nest 3/23: all chicks in the nest dead, uncertain of total number of chicks; 3/29: one dead egg still in nestcup, flag pulled" +2023,hidden,20,bcnh,2023-03-09,,2,nestling,"2/16: possible bcnh 3/9: possibly 3 chicks, not 2 3/16: some eggshell in nest 3/23: all chicks in the nest dead, uncertain of total number of chicks; 3/29: one dead egg still in nestcup, flag pulled" +2023,hidden,20,bcnh,2023-03-16,,2,nestling,"2/16: possible bcnh 3/9: possibly 3 chicks, not 2 3/16: some eggshell in nest 3/23: all chicks in the nest dead, uncertain of total number of chicks; 3/29: one dead egg still in nestcup, flag pulled" +2023,hidden,20,bcnh,2023-03-23,,,empty,"2/16: possible bcnh 3/9: possibly 3 chicks, not 2 3/16: some eggshell in nest 3/23: all chicks in the nest dead, uncertain of total number of chicks; 3/29: one dead egg still in nestcup, flag pulled" +2023,hidden,20,bcnh,2023-03-29,,,pulled,"2/16: possible bcnh 3/9: possibly 3 chicks, not 2 3/16: some eggshell in nest 3/23: all chicks in the nest dead, uncertain of total number of chicks; 3/29: one dead egg still in nestcup, flag pulled" +2023,hidden,20,bcnh,2023-04-06,,,,"2/16: possible bcnh 3/9: possibly 3 chicks, not 2 3/16: some eggshell in nest 3/23: all chicks in the nest dead, uncertain of total number of chicks; 3/29: one dead egg still in nestcup, flag pulled" +2023,hidden,20,bcnh,2023-04-14,,,,"2/16: possible bcnh 3/9: possibly 3 chicks, not 2 3/16: some eggshell in nest 3/23: all chicks in the nest dead, uncertain of total number of chicks; 3/29: one dead egg still in nestcup, flag pulled" +2023,hidden,20,bcnh,2023-04-21,,,,"2/16: possible bcnh 3/9: possibly 3 chicks, not 2 3/16: some eggshell in nest 3/23: all chicks in the nest dead, uncertain of total number of chicks; 3/29: one dead egg still in nestcup, flag pulled" +2023,hidden,20,bcnh,2023-04-28,,,,"2/16: possible bcnh 3/9: possibly 3 chicks, not 2 3/16: some eggshell in nest 3/23: all chicks in the nest dead, uncertain of total number of chicks; 3/29: one dead egg still in nestcup, flag pulled" +2023,hidden,20,bcnh,2023-05-05,,,,"2/16: possible bcnh 3/9: possibly 3 chicks, not 2 3/16: some eggshell in nest 3/23: all chicks in the nest dead, uncertain of total number of chicks; 3/29: one dead egg still in nestcup, flag pulled" +2023,hidden,22,bcnh,2023-02-16,2,,incubating,"3/9: ID changed from greg to bcnh, one chick wet 3/16: can only confirm 2 chicks but possible there are 3 chicks 3/23: chicks have been fed 4/14: chick big, up high above nest area" +2023,hidden,22,bcnh,2023-02-23,3,,incubating,"3/9: ID changed from greg to bcnh, one chick wet 3/16: can only confirm 2 chicks but possible there are 3 chicks 3/23: chicks have been fed 4/14: chick big, up high above nest area" +2023,hidden,22,bcnh,2023-03-02,3,,incubating,"3/9: ID changed from greg to bcnh, one chick wet 3/16: can only confirm 2 chicks but possible there are 3 chicks 3/23: chicks have been fed 4/14: chick big, up high above nest area" +2023,hidden,22,bcnh,2023-03-09,1,2,wet_chick,"3/9: ID changed from greg to bcnh, one chick wet 3/16: can only confirm 2 chicks but possible there are 3 chicks 3/23: chicks have been fed 4/14: chick big, up high above nest area" +2023,hidden,22,bcnh,2023-03-16,,2,nestling,"3/9: ID changed from greg to bcnh, one chick wet 3/16: can only confirm 2 chicks but possible there are 3 chicks 3/23: chicks have been fed 4/14: chick big, up high above nest area" +2023,hidden,22,bcnh,2023-03-23,,2,nestling,"3/9: ID changed from greg to bcnh, one chick wet 3/16: can only confirm 2 chicks but possible there are 3 chicks 3/23: chicks have been fed 4/14: chick big, up high above nest area" +2023,hidden,22,bcnh,2023-03-29,,1,nestling,"3/9: ID changed from greg to bcnh, one chick wet 3/16: can only confirm 2 chicks but possible there are 3 chicks 3/23: chicks have been fed 4/14: chick big, up high above nest area" +2023,hidden,22,bcnh,2023-04-06,,,empty,"3/9: ID changed from greg to bcnh, one chick wet 3/16: can only confirm 2 chicks but possible there are 3 chicks 3/23: chicks have been fed 4/14: chick big, up high above nest area" +2023,hidden,22,bcnh,2023-04-14,,1,nestling,"3/9: ID changed from greg to bcnh, one chick wet 3/16: can only confirm 2 chicks but possible there are 3 chicks 3/23: chicks have been fed 4/14: chick big, up high above nest area" +2023,hidden,22,bcnh,2023-04-21,,,empty,"3/9: ID changed from greg to bcnh, one chick wet 3/16: can only confirm 2 chicks but possible there are 3 chicks 3/23: chicks have been fed 4/14: chick big, up high above nest area" +2023,hidden,22,bcnh,2023-04-28,,,pulled,"3/9: ID changed from greg to bcnh, one chick wet 3/16: can only confirm 2 chicks but possible there are 3 chicks 3/23: chicks have been fed 4/14: chick big, up high above nest area" +2023,hidden,22,bcnh,2023-05-05,,,,"3/9: ID changed from greg to bcnh, one chick wet 3/16: can only confirm 2 chicks but possible there are 3 chicks 3/23: chicks have been fed 4/14: chick big, up high above nest area" +2023,hidden,15,greg,2023-02-16,2,,incubating,"2/16: eggshell underneath; 2/23: nest gone, eggshell underneath; 3/2: pulled flag" +2023,hidden,15,greg,2023-02-23,,,empty,"2/16: eggshell underneath; 2/23: nest gone, eggshell underneath; 3/2: pulled flag" +2023,hidden,15,greg,2023-03-02,,,pulled,"2/16: eggshell underneath; 2/23: nest gone, eggshell underneath; 3/2: pulled flag" +2023,hidden,15,greg,2023-03-09,,,,"2/16: eggshell underneath; 2/23: nest gone, eggshell underneath; 3/2: pulled flag" +2023,hidden,15,greg,2023-03-16,,,,"2/16: eggshell underneath; 2/23: nest gone, eggshell underneath; 3/2: pulled flag" +2023,hidden,15,greg,2023-03-23,,,,"2/16: eggshell underneath; 2/23: nest gone, eggshell underneath; 3/2: pulled flag" +2023,hidden,15,greg,2023-03-29,,,,"2/16: eggshell underneath; 2/23: nest gone, eggshell underneath; 3/2: pulled flag" +2023,hidden,15,greg,2023-04-06,,,,"2/16: eggshell underneath; 2/23: nest gone, eggshell underneath; 3/2: pulled flag" +2023,hidden,15,greg,2023-04-14,,,,"2/16: eggshell underneath; 2/23: nest gone, eggshell underneath; 3/2: pulled flag" +2023,hidden,15,greg,2023-04-21,,,,"2/16: eggshell underneath; 2/23: nest gone, eggshell underneath; 3/2: pulled flag" +2023,hidden,15,greg,2023-04-28,,,,"2/16: eggshell underneath; 2/23: nest gone, eggshell underneath; 3/2: pulled flag" +2023,hidden,15,greg,2023-05-05,,,,"2/16: eggshell underneath; 2/23: nest gone, eggshell underneath; 3/2: pulled flag" +2023,hidden,24,greg,2023-02-16,2,,incubating,"3/9: chick slightly damp 3/29: 2nd chick dead, first chick mercury sampled 4/21: pulled flag" +2023,hidden,24,greg,2023-02-23,2,,incubating,"3/9: chick slightly damp 3/29: 2nd chick dead, first chick mercury sampled 4/21: pulled flag" +2023,hidden,24,greg,2023-03-02,2,,incubating,"3/9: chick slightly damp 3/29: 2nd chick dead, first chick mercury sampled 4/21: pulled flag" +2023,hidden,24,greg,2023-03-09,,2,nestling,"3/9: chick slightly damp 3/29: 2nd chick dead, first chick mercury sampled 4/21: pulled flag" +2023,hidden,24,greg,2023-03-16,,2,nestling,"3/9: chick slightly damp 3/29: 2nd chick dead, first chick mercury sampled 4/21: pulled flag" +2023,hidden,24,greg,2023-03-23,,2,nestling,"3/9: chick slightly damp 3/29: 2nd chick dead, first chick mercury sampled 4/21: pulled flag" +2023,hidden,24,greg,2023-03-29,,1,nestling,"3/9: chick slightly damp 3/29: 2nd chick dead, first chick mercury sampled 4/21: pulled flag" +2023,hidden,24,greg,2023-04-06,,1,nestling,"3/9: chick slightly damp 3/29: 2nd chick dead, first chick mercury sampled 4/21: pulled flag" +2023,hidden,24,greg,2023-04-14,,,empty,"3/9: chick slightly damp 3/29: 2nd chick dead, first chick mercury sampled 4/21: pulled flag" +2023,hidden,24,greg,2023-04-21,,,pulled,"3/9: chick slightly damp 3/29: 2nd chick dead, first chick mercury sampled 4/21: pulled flag" +2023,hidden,24,greg,2023-04-28,,,,"3/9: chick slightly damp 3/29: 2nd chick dead, first chick mercury sampled 4/21: pulled flag" +2023,hidden,24,greg,2023-05-05,,,,"3/9: chick slightly damp 3/29: 2nd chick dead, first chick mercury sampled 4/21: pulled flag" +2023,hidden,26,greg,2023-02-16,2,,incubating,"3/16: 1 live chick and 1 dead chick in nest; 4/28: one large chick directly in nest, looks to be in good condition, random fledgling?" +2023,hidden,26,greg,2023-02-23,2,,incubating,"3/16: 1 live chick and 1 dead chick in nest; 4/28: one large chick directly in nest, looks to be in good condition, random fledgling?" +2023,hidden,26,greg,2023-03-02,,2,chick_dry,"3/16: 1 live chick and 1 dead chick in nest; 4/28: one large chick directly in nest, looks to be in good condition, random fledgling?" +2023,hidden,26,greg,2023-03-09,,2,nestling,"3/16: 1 live chick and 1 dead chick in nest; 4/28: one large chick directly in nest, looks to be in good condition, random fledgling?" +2023,hidden,26,greg,2023-03-16,,1,nestling,"3/16: 1 live chick and 1 dead chick in nest; 4/28: one large chick directly in nest, looks to be in good condition, random fledgling?" +2023,hidden,26,greg,2023-03-23,,1,nestling,"3/16: 1 live chick and 1 dead chick in nest; 4/28: one large chick directly in nest, looks to be in good condition, random fledgling?" +2023,hidden,26,greg,2023-03-29,,1,nestling,"3/16: 1 live chick and 1 dead chick in nest; 4/28: one large chick directly in nest, looks to be in good condition, random fledgling?" +2023,hidden,26,greg,2023-04-06,,1,nestling,"3/16: 1 live chick and 1 dead chick in nest; 4/28: one large chick directly in nest, looks to be in good condition, random fledgling?" +2023,hidden,26,greg,2023-04-14,,,empty,"3/16: 1 live chick and 1 dead chick in nest; 4/28: one large chick directly in nest, looks to be in good condition, random fledgling?" +2023,hidden,26,greg,2023-04-21,,,empty,"3/16: 1 live chick and 1 dead chick in nest; 4/28: one large chick directly in nest, looks to be in good condition, random fledgling?" +2023,hidden,26,greg,2023-04-28,,1,branchling,"3/16: 1 live chick and 1 dead chick in nest; 4/28: one large chick directly in nest, looks to be in good condition, random fledgling?" +2023,hidden,26,greg,2023-05-05,,,empty,"3/16: 1 live chick and 1 dead chick in nest; 4/28: one large chick directly in nest, looks to be in good condition, random fledgling?" +2023,hidden,28,greg,2023-02-16,2,,incubating,"3/9: both dry" +2023,hidden,28,greg,2023-02-23,2,,incubating,"3/9: both dry" +2023,hidden,28,greg,2023-03-02,2,,incubating,"3/9: both dry" +2023,hidden,28,greg,2023-03-09,,2,chick_dry,"3/9: both dry" +2023,hidden,28,greg,2023-03-16,,2,nestling,"3/9: both dry" +2023,hidden,28,greg,2023-03-23,,2,nestling,"3/9: both dry" +2023,hidden,28,greg,2023-03-29,,1,nestling,"3/9: both dry" +2023,hidden,28,greg,2023-04-06,,1,nestling,"3/9: both dry" +2023,hidden,28,greg,2023-04-14,,,empty,"3/9: both dry" +2023,hidden,28,greg,2023-04-21,,,empty,"3/9: both dry" +2023,hidden,28,greg,2023-04-28,,,empty,"3/9: both dry" +2023,hidden,28,greg,2023-05-05,,,,"3/9: both dry" +2023,hidden,30,greg,2023-02-16,2,,incubating,"3/29: chick out of nest on vine 4/6: pulled flag" +2023,hidden,30,greg,2023-02-23,2,,incubating,"3/29: chick out of nest on vine 4/6: pulled flag" +2023,hidden,30,greg,2023-03-02,,2,nestling,"3/29: chick out of nest on vine 4/6: pulled flag" +2023,hidden,30,greg,2023-03-09,,2,nestling,"3/29: chick out of nest on vine 4/6: pulled flag" +2023,hidden,30,greg,2023-03-16,,2,nestling,"3/29: chick out of nest on vine 4/6: pulled flag" +2023,hidden,30,greg,2023-03-23,,2,nestling,"3/29: chick out of nest on vine 4/6: pulled flag" +2023,hidden,30,greg,2023-03-29,,1,nestling,"3/29: chick out of nest on vine 4/6: pulled flag" +2023,hidden,30,greg,2023-04-06,,,empty,"3/29: chick out of nest on vine 4/6: pulled flag" +2023,hidden,30,greg,2023-04-14,,,,"3/29: chick out of nest on vine 4/6: pulled flag" +2023,hidden,30,greg,2023-04-21,,,,"3/29: chick out of nest on vine 4/6: pulled flag" +2023,hidden,30,greg,2023-04-28,,,,"3/29: chick out of nest on vine 4/6: pulled flag" +2023,hidden,30,greg,2023-05-05,,,,"3/29: chick out of nest on vine 4/6: pulled flag" +2023,hidden,32,greg,2023-02-16,2,,incubating,"2/23: nest gone; 3/2: pulled flag" +2023,hidden,32,greg,2023-02-23,,,empty,"2/23: nest gone; 3/2: pulled flag" +2023,hidden,32,greg,2023-03-02,,,pulled,"2/23: nest gone; 3/2: pulled flag" +2023,hidden,32,greg,2023-03-09,,,,"2/23: nest gone; 3/2: pulled flag" +2023,hidden,32,greg,2023-03-16,,,,"2/23: nest gone; 3/2: pulled flag" +2023,hidden,32,greg,2023-03-23,,,,"2/23: nest gone; 3/2: pulled flag" +2023,hidden,32,greg,2023-03-29,,,,"2/23: nest gone; 3/2: pulled flag" +2023,hidden,32,greg,2023-04-06,,,,"2/23: nest gone; 3/2: pulled flag" +2023,hidden,32,greg,2023-04-14,,,,"2/23: nest gone; 3/2: pulled flag" +2023,hidden,32,greg,2023-04-21,,,,"2/23: nest gone; 3/2: pulled flag" +2023,hidden,32,greg,2023-04-28,,,,"2/23: nest gone; 3/2: pulled flag" +2023,hidden,32,greg,2023-05-05,,,,"2/23: nest gone; 3/2: pulled flag" +2023,hidden,17,greg,2023-02-16,,3,nestling,"2/16: dry chicks, less than 1 week old 3/2: certain of two chicks 3/9: certain only 2 chicks 4/14: Big chick in nest, but could be from somewhere else 4/21: pulled flag" +2023,hidden,17,greg,2023-02-23,,3,nestling,"2/16: dry chicks, less than 1 week old 3/2: certain of two chicks 3/9: certain only 2 chicks 4/14: Big chick in nest, but could be from somewhere else 4/21: pulled flag" +2023,hidden,17,greg,2023-03-02,,2,nestling,"2/16: dry chicks, less than 1 week old 3/2: certain of two chicks 3/9: certain only 2 chicks 4/14: Big chick in nest, but could be from somewhere else 4/21: pulled flag" +2023,hidden,17,greg,2023-03-09,,2,nestling,"2/16: dry chicks, less than 1 week old 3/2: certain of two chicks 3/9: certain only 2 chicks 4/14: Big chick in nest, but could be from somewhere else 4/21: pulled flag" +2023,hidden,17,greg,2023-03-16,,2,nestling,"2/16: dry chicks, less than 1 week old 3/2: certain of two chicks 3/9: certain only 2 chicks 4/14: Big chick in nest, but could be from somewhere else 4/21: pulled flag" +2023,hidden,17,greg,2023-03-23,,2,nestling,"2/16: dry chicks, less than 1 week old 3/2: certain of two chicks 3/9: certain only 2 chicks 4/14: Big chick in nest, but could be from somewhere else 4/21: pulled flag" +2023,hidden,17,greg,2023-03-29,,,empty,"2/16: dry chicks, less than 1 week old 3/2: certain of two chicks 3/9: certain only 2 chicks 4/14: Big chick in nest, but could be from somewhere else 4/21: pulled flag" +2023,hidden,17,greg,2023-04-06,,,empty,"2/16: dry chicks, less than 1 week old 3/2: certain of two chicks 3/9: certain only 2 chicks 4/14: Big chick in nest, but could be from somewhere else 4/21: pulled flag" +2023,hidden,17,greg,2023-04-14,,1,nestling,"2/16: dry chicks, less than 1 week old 3/2: certain of two chicks 3/9: certain only 2 chicks 4/14: Big chick in nest, but could be from somewhere else 4/21: pulled flag" +2023,hidden,17,greg,2023-04-21,,,empty,"2/16: dry chicks, less than 1 week old 3/2: certain of two chicks 3/9: certain only 2 chicks 4/14: Big chick in nest, but could be from somewhere else 4/21: pulled flag" +2023,hidden,17,greg,2023-04-28,,,,"2/16: dry chicks, less than 1 week old 3/2: certain of two chicks 3/9: certain only 2 chicks 4/14: Big chick in nest, but could be from somewhere else 4/21: pulled flag" +2023,hidden,17,greg,2023-05-05,,,,"2/16: dry chicks, less than 1 week old 3/2: certain of two chicks 3/9: certain only 2 chicks 4/14: Big chick in nest, but could be from somewhere else 4/21: pulled flag" +2023,hidden,34,bcnh,2023-02-16,3,,incubating,"3/23: one dead chick in nest, and another dead chick nearby" +2023,hidden,34,bcnh,2023-02-23,3,,incubating,"3/23: one dead chick in nest, and another dead chick nearby" +2023,hidden,34,bcnh,2023-03-02,2,1,chick_dry,"3/23: one dead chick in nest, and another dead chick nearby" +2023,hidden,34,bcnh,2023-03-09,,3,nestling,"3/23: one dead chick in nest, and another dead chick nearby" +2023,hidden,34,bcnh,2023-03-16,,3,nestling,"3/23: one dead chick in nest, and another dead chick nearby" +2023,hidden,34,bcnh,2023-03-23,,1,nestling,"3/23: one dead chick in nest, and another dead chick nearby" +2023,hidden,34,bcnh,2023-03-29,,1,nestling,"3/23: one dead chick in nest, and another dead chick nearby" +2023,hidden,34,bcnh,2023-04-06,,1,nestling,"3/23: one dead chick in nest, and another dead chick nearby" +2023,hidden,34,bcnh,2023-04-14,,,empty,"3/23: one dead chick in nest, and another dead chick nearby" +2023,hidden,34,bcnh,2023-04-21,,,pulled,"3/23: one dead chick in nest, and another dead chick nearby" +2023,hidden,34,bcnh,2023-04-28,,,,"3/23: one dead chick in nest, and another dead chick nearby" +2023,hidden,34,bcnh,2023-05-05,,,,"3/23: one dead chick in nest, and another dead chick nearby" +2023,hidden,131,greg,2023-02-16,,,,"3/16: pulled flag, nest gone" +2023,hidden,131,greg,2023-02-23,1,,incubating,"3/16: pulled flag, nest gone" +2023,hidden,131,greg,2023-03-02,2,,incubating,"3/16: pulled flag, nest gone" +2023,hidden,131,greg,2023-03-09,2,,incubating,"3/16: pulled flag, nest gone" +2023,hidden,131,greg,2023-03-16,,,empty,"3/16: pulled flag, nest gone" +2023,hidden,131,greg,2023-03-23,,,,"3/16: pulled flag, nest gone" +2023,hidden,131,greg,2023-03-29,,,,"3/16: pulled flag, nest gone" +2023,hidden,131,greg,2023-04-06,,,,"3/16: pulled flag, nest gone" +2023,hidden,131,greg,2023-04-14,,,,"3/16: pulled flag, nest gone" +2023,hidden,131,greg,2023-04-21,,,,"3/16: pulled flag, nest gone" +2023,hidden,131,greg,2023-04-28,,,,"3/16: pulled flag, nest gone" +2023,hidden,131,greg,2023-05-05,,,,"3/16: pulled flag, nest gone" +2023,hidden,19,greg,2023-02-16,2,,incubating, +2023,hidden,19,greg,2023-02-23,2,,incubating, +2023,hidden,19,greg,2023-03-02,,2,chick_dry, +2023,hidden,19,greg,2023-03-09,,2,nestling, +2023,hidden,19,greg,2023-03-16,,2,nestling, +2023,hidden,19,greg,2023-03-23,,2,nestling, +2023,hidden,19,greg,2023-03-29,,1,nestling, +2023,hidden,19,greg,2023-04-06,,1,nestling, +2023,hidden,19,greg,2023-04-14,,,empty, +2023,hidden,19,greg,2023-04-21,,,pulled, +2023,hidden,19,greg,2023-04-28,,,, +2023,hidden,19,greg,2023-05-05,,,, +2023,hidden,44,greg,2023-02-16,3,,incubating,"3/2: pulled flag" +2023,hidden,44,greg,2023-02-23,3,,incubating,"3/2: pulled flag" +2023,hidden,44,greg,2023-03-02,,,empty,"3/2: pulled flag" +2023,hidden,44,greg,2023-03-09,,,,"3/2: pulled flag" +2023,hidden,44,greg,2023-03-16,,,,"3/2: pulled flag" +2023,hidden,44,greg,2023-03-23,,,,"3/2: pulled flag" +2023,hidden,44,greg,2023-03-29,,,,"3/2: pulled flag" +2023,hidden,44,greg,2023-04-06,,,,"3/2: pulled flag" +2023,hidden,44,greg,2023-04-14,,,,"3/2: pulled flag" +2023,hidden,44,greg,2023-04-21,,,,"3/2: pulled flag" +2023,hidden,44,greg,2023-04-28,,,,"3/2: pulled flag" +2023,hidden,44,greg,2023-05-05,,,,"3/2: pulled flag" +2023,hidden,21,bcnh,2023-02-16,2,,incubating,"3/2: probably BCNH; 3/9: chicks dry 3/29: 1 chick dead in nest 4/6: pulled flag" +2023,hidden,21,bcnh,2023-02-23,2,,incubating,"3/2: probably BCNH; 3/9: chicks dry 3/29: 1 chick dead in nest 4/6: pulled flag" +2023,hidden,21,bcnh,2023-03-02,2,,incubating,"3/2: probably BCNH; 3/9: chicks dry 3/29: 1 chick dead in nest 4/6: pulled flag" +2023,hidden,21,bcnh,2023-03-09,,2,chick_dry,"3/2: probably BCNH; 3/9: chicks dry 3/29: 1 chick dead in nest 4/6: pulled flag" +2023,hidden,21,bcnh,2023-03-16,,2,nestling,"3/2: probably BCNH; 3/9: chicks dry 3/29: 1 chick dead in nest 4/6: pulled flag" +2023,hidden,21,bcnh,2023-03-23,,2,nestling,"3/2: probably BCNH; 3/9: chicks dry 3/29: 1 chick dead in nest 4/6: pulled flag" +2023,hidden,21,bcnh,2023-03-29,,,empty,"3/2: probably BCNH; 3/9: chicks dry 3/29: 1 chick dead in nest 4/6: pulled flag" +2023,hidden,21,bcnh,2023-04-06,,,pulled,"3/2: probably BCNH; 3/9: chicks dry 3/29: 1 chick dead in nest 4/6: pulled flag" +2023,hidden,21,bcnh,2023-04-14,,,,"3/2: probably BCNH; 3/9: chicks dry 3/29: 1 chick dead in nest 4/6: pulled flag" +2023,hidden,21,bcnh,2023-04-21,,,,"3/2: probably BCNH; 3/9: chicks dry 3/29: 1 chick dead in nest 4/6: pulled flag" +2023,hidden,21,bcnh,2023-04-28,,,,"3/2: probably BCNH; 3/9: chicks dry 3/29: 1 chick dead in nest 4/6: pulled flag" +2023,hidden,21,bcnh,2023-05-05,,,,"3/2: probably BCNH; 3/9: chicks dry 3/29: 1 chick dead in nest 4/6: pulled flag" +2023,hidden,46,greg,2023-02-16,1,,incubating,"2/23: nest gone, eggshells under nest 3/2: pulled flagging" +2023,hidden,46,greg,2023-02-23,,,empty,"2/23: nest gone, eggshells under nest 3/2: pulled flagging" +2023,hidden,46,greg,2023-03-02,,,pulled,"2/23: nest gone, eggshells under nest 3/2: pulled flagging" +2023,hidden,46,greg,2023-03-09,,,,"2/23: nest gone, eggshells under nest 3/2: pulled flagging" +2023,hidden,46,greg,2023-03-16,,,,"2/23: nest gone, eggshells under nest 3/2: pulled flagging" +2023,hidden,46,greg,2023-03-23,,,,"2/23: nest gone, eggshells under nest 3/2: pulled flagging" +2023,hidden,46,greg,2023-03-29,,,,"2/23: nest gone, eggshells under nest 3/2: pulled flagging" +2023,hidden,46,greg,2023-04-06,,,,"2/23: nest gone, eggshells under nest 3/2: pulled flagging" +2023,hidden,46,greg,2023-04-14,,,,"2/23: nest gone, eggshells under nest 3/2: pulled flagging" +2023,hidden,46,greg,2023-04-21,,,,"2/23: nest gone, eggshells under nest 3/2: pulled flagging" +2023,hidden,46,greg,2023-04-28,,,,"2/23: nest gone, eggshells under nest 3/2: pulled flagging" +2023,hidden,46,greg,2023-05-05,,,,"2/23: nest gone, eggshells under nest 3/2: pulled flagging" +2023,hidden,23,greg,2023-02-16,2,,incubating,"2/23: oddly placed egg, pointed end down in nest material 4/14: pulled flag" +2023,hidden,23,greg,2023-02-23,1,,incubating,"2/23: oddly placed egg, pointed end down in nest material 4/14: pulled flag" +2023,hidden,23,greg,2023-03-02,1,,incubating,"2/23: oddly placed egg, pointed end down in nest material 4/14: pulled flag" +2023,hidden,23,greg,2023-03-09,2,,incubating,"2/23: oddly placed egg, pointed end down in nest material 4/14: pulled flag" +2023,hidden,23,greg,2023-03-16,2,,incubating,"2/23: oddly placed egg, pointed end down in nest material 4/14: pulled flag" +2023,hidden,23,greg,2023-03-23,2,,incubating,"2/23: oddly placed egg, pointed end down in nest material 4/14: pulled flag" +2023,hidden,23,greg,2023-03-29,,,empty,"2/23: oddly placed egg, pointed end down in nest material 4/14: pulled flag" +2023,hidden,23,greg,2023-04-06,,,empty,"2/23: oddly placed egg, pointed end down in nest material 4/14: pulled flag" +2023,hidden,23,greg,2023-04-14,,,pulled,"2/23: oddly placed egg, pointed end down in nest material 4/14: pulled flag" +2023,hidden,23,greg,2023-04-21,,,,"2/23: oddly placed egg, pointed end down in nest material 4/14: pulled flag" +2023,hidden,23,greg,2023-04-28,,,,"2/23: oddly placed egg, pointed end down in nest material 4/14: pulled flag" +2023,hidden,23,greg,2023-05-05,,,,"2/23: oddly placed egg, pointed end down in nest material 4/14: pulled flag" +2023,hidden,48,greg,2023-02-16,2,,incubating,"3/9: certain 2 chicks" +2023,hidden,48,greg,2023-02-23,2,,incubating,"3/9: certain 2 chicks" +2023,hidden,48,greg,2023-03-02,,2,chick_dry,"3/9: certain 2 chicks" +2023,hidden,48,greg,2023-03-09,,2,nestling,"3/9: certain 2 chicks" +2023,hidden,48,greg,2023-03-16,,2,nestling,"3/9: certain 2 chicks" +2023,hidden,48,greg,2023-03-23,,2,nestling,"3/9: certain 2 chicks" +2023,hidden,48,greg,2023-03-29,,2,nestling,"3/9: certain 2 chicks" +2023,hidden,48,greg,2023-04-06,,1,nestling,"3/9: certain 2 chicks" +2023,hidden,48,greg,2023-04-14,,,empty,"3/9: certain 2 chicks" +2023,hidden,48,greg,2023-04-21,,,pulled,"3/9: certain 2 chicks" +2023,hidden,48,greg,2023-04-28,,,,"3/9: certain 2 chicks" +2023,hidden,48,greg,2023-05-05,,,,"3/9: certain 2 chicks" +2023,hidden,25,greg,2023-02-16,2,,incubating,"3/2: pulled flag" +2023,hidden,25,greg,2023-02-23,,,empty,"3/2: pulled flag" +2023,hidden,25,greg,2023-03-02,,,pulled,"3/2: pulled flag" +2023,hidden,25,greg,2023-03-09,,,,"3/2: pulled flag" +2023,hidden,25,greg,2023-03-16,,,,"3/2: pulled flag" +2023,hidden,25,greg,2023-03-23,,,,"3/2: pulled flag" +2023,hidden,25,greg,2023-03-29,,,,"3/2: pulled flag" +2023,hidden,25,greg,2023-04-06,,,,"3/2: pulled flag" +2023,hidden,25,greg,2023-04-14,,,,"3/2: pulled flag" +2023,hidden,25,greg,2023-04-21,,,,"3/2: pulled flag" +2023,hidden,25,greg,2023-04-28,,,,"3/2: pulled flag" +2023,hidden,25,greg,2023-05-05,,,,"3/2: pulled flag" +2023,hidden,50,greg,2023-02-16,3,,incubating,"2/23: chick wet 3/9: certain 3 chicks 3/23: chick in branches by 128, could have come from nest 50" +2023,hidden,50,greg,2023-02-23,2,1,wet_chick,"2/23: chick wet 3/9: certain 3 chicks 3/23: chick in branches by 128, could have come from nest 50" +2023,hidden,50,greg,2023-03-02,,2,nestling,"2/23: chick wet 3/9: certain 3 chicks 3/23: chick in branches by 128, could have come from nest 50" +2023,hidden,50,greg,2023-03-09,,3,nestling,"2/23: chick wet 3/9: certain 3 chicks 3/23: chick in branches by 128, could have come from nest 50" +2023,hidden,50,greg,2023-03-16,,3,nestling,"2/23: chick wet 3/9: certain 3 chicks 3/23: chick in branches by 128, could have come from nest 50" +2023,hidden,50,greg,2023-03-23,,1,nestling,"2/23: chick wet 3/9: certain 3 chicks 3/23: chick in branches by 128, could have come from nest 50" +2023,hidden,50,greg,2023-03-29,,1,nestling,"2/23: chick wet 3/9: certain 3 chicks 3/23: chick in branches by 128, could have come from nest 50" +2023,hidden,50,greg,2023-04-06,,1,nestling,"2/23: chick wet 3/9: certain 3 chicks 3/23: chick in branches by 128, could have come from nest 50" +2023,hidden,50,greg,2023-04-14,,,empty,"2/23: chick wet 3/9: certain 3 chicks 3/23: chick in branches by 128, could have come from nest 50" +2023,hidden,50,greg,2023-04-21,,,pulled,"2/23: chick wet 3/9: certain 3 chicks 3/23: chick in branches by 128, could have come from nest 50" +2023,hidden,50,greg,2023-04-28,,,,"2/23: chick wet 3/9: certain 3 chicks 3/23: chick in branches by 128, could have come from nest 50" +2023,hidden,50,greg,2023-05-05,,,,"2/23: chick wet 3/9: certain 3 chicks 3/23: chick in branches by 128, could have come from nest 50" +2023,hidden,52,greg,2023-02-16,3,,incubating,"3/2: one chick dry and one wet 3/9: certain 3 chicks 3/16: certain 3 chicks in nest, 3/23: chicks don't look very good 4/6: 1 chick dead in nest 4/21: pulled flag" +2023,hidden,52,greg,2023-02-23,3,,incubating,"3/2: one chick dry and one wet 3/9: certain 3 chicks 3/16: certain 3 chicks in nest, 3/23: chicks don't look very good 4/6: 1 chick dead in nest 4/21: pulled flag" +2023,hidden,52,greg,2023-03-02,1,2,wet_chick,"3/2: one chick dry and one wet 3/9: certain 3 chicks 3/16: certain 3 chicks in nest, 3/23: chicks don't look very good 4/6: 1 chick dead in nest 4/21: pulled flag" +2023,hidden,52,greg,2023-03-09,,3,nestling,"3/2: one chick dry and one wet 3/9: certain 3 chicks 3/16: certain 3 chicks in nest, 3/23: chicks don't look very good 4/6: 1 chick dead in nest 4/21: pulled flag" +2023,hidden,52,greg,2023-03-16,,3,nestling,"3/2: one chick dry and one wet 3/9: certain 3 chicks 3/16: certain 3 chicks in nest, 3/23: chicks don't look very good 4/6: 1 chick dead in nest 4/21: pulled flag" +2023,hidden,52,greg,2023-03-23,,2,nestling,"3/2: one chick dry and one wet 3/9: certain 3 chicks 3/16: certain 3 chicks in nest, 3/23: chicks don't look very good 4/6: 1 chick dead in nest 4/21: pulled flag" +2023,hidden,52,greg,2023-03-29,,2,nestling,"3/2: one chick dry and one wet 3/9: certain 3 chicks 3/16: certain 3 chicks in nest, 3/23: chicks don't look very good 4/6: 1 chick dead in nest 4/21: pulled flag" +2023,hidden,52,greg,2023-04-06,,1,nestling,"3/2: one chick dry and one wet 3/9: certain 3 chicks 3/16: certain 3 chicks in nest, 3/23: chicks don't look very good 4/6: 1 chick dead in nest 4/21: pulled flag" +2023,hidden,52,greg,2023-04-14,,1,nestling,"3/2: one chick dry and one wet 3/9: certain 3 chicks 3/16: certain 3 chicks in nest, 3/23: chicks don't look very good 4/6: 1 chick dead in nest 4/21: pulled flag" +2023,hidden,52,greg,2023-04-21,,,empty,"3/2: one chick dry and one wet 3/9: certain 3 chicks 3/16: certain 3 chicks in nest, 3/23: chicks don't look very good 4/6: 1 chick dead in nest 4/21: pulled flag" +2023,hidden,52,greg,2023-04-28,,,,"3/2: one chick dry and one wet 3/9: certain 3 chicks 3/16: certain 3 chicks in nest, 3/23: chicks don't look very good 4/6: 1 chick dead in nest 4/21: pulled flag" +2023,hidden,52,greg,2023-05-05,,,,"3/2: one chick dry and one wet 3/9: certain 3 chicks 3/16: certain 3 chicks in nest, 3/23: chicks don't look very good 4/6: 1 chick dead in nest 4/21: pulled flag" +2023,hidden,36,greg,2023-02-16,,2,wet_chick,"2/16: one chick dry, one chick wet 3/16: chicks starting to leave nest" +2023,hidden,36,greg,2023-02-23,,2,nestling,"2/16: one chick dry, one chick wet 3/16: chicks starting to leave nest" +2023,hidden,36,greg,2023-03-02,,2,nestling,"2/16: one chick dry, one chick wet 3/16: chicks starting to leave nest" +2023,hidden,36,greg,2023-03-09,,2,nestling,"2/16: one chick dry, one chick wet 3/16: chicks starting to leave nest" +2023,hidden,36,greg,2023-03-16,,2,nestling,"2/16: one chick dry, one chick wet 3/16: chicks starting to leave nest" +2023,hidden,36,greg,2023-03-23,,1,nestling,"2/16: one chick dry, one chick wet 3/16: chicks starting to leave nest" +2023,hidden,36,greg,2023-03-29,,,empty,"2/16: one chick dry, one chick wet 3/16: chicks starting to leave nest" +2023,hidden,36,greg,2023-04-06,,,empty,"2/16: one chick dry, one chick wet 3/16: chicks starting to leave nest" +2023,hidden,36,greg,2023-04-14,,,empty,"2/16: one chick dry, one chick wet 3/16: chicks starting to leave nest" +2023,hidden,36,greg,2023-04-21,,,pulled,"2/16: one chick dry, one chick wet 3/16: chicks starting to leave nest" +2023,hidden,36,greg,2023-04-28,,,,"2/16: one chick dry, one chick wet 3/16: chicks starting to leave nest" +2023,hidden,36,greg,2023-05-05,,,,"2/16: one chick dry, one chick wet 3/16: chicks starting to leave nest" +2023,hidden,54,greg,2023-02-16,2,,incubating,"3/16: pulled flag, nest gone" +2023,hidden,54,greg,2023-02-23,2,,incubating,"3/16: pulled flag, nest gone" +2023,hidden,54,greg,2023-03-02,,,empty,"3/16: pulled flag, nest gone" +2023,hidden,54,greg,2023-03-09,,,empty,"3/16: pulled flag, nest gone" +2023,hidden,54,greg,2023-03-16,,,pulled,"3/16: pulled flag, nest gone" +2023,hidden,54,greg,2023-03-23,,,,"3/16: pulled flag, nest gone" +2023,hidden,54,greg,2023-03-29,,,,"3/16: pulled flag, nest gone" +2023,hidden,54,greg,2023-04-06,,,,"3/16: pulled flag, nest gone" +2023,hidden,54,greg,2023-04-14,,,,"3/16: pulled flag, nest gone" +2023,hidden,54,greg,2023-04-21,,,,"3/16: pulled flag, nest gone" +2023,hidden,54,greg,2023-04-28,,,,"3/16: pulled flag, nest gone" +2023,hidden,54,greg,2023-05-05,,,,"3/16: pulled flag, nest gone" +2023,hidden,56,greg,2023-02-16,3,,incubating,"3/23: one dead chick on the ground 3/29: mercury sampled chick that could have been from nest 56 4/6: chick in nest looks big and healthy 4/14: Big chick 4/21: pulled flag" +2023,hidden,56,greg,2023-02-23,3,,incubating,"3/23: one dead chick on the ground 3/29: mercury sampled chick that could have been from nest 56 4/6: chick in nest looks big and healthy 4/14: Big chick 4/21: pulled flag" +2023,hidden,56,greg,2023-03-02,3,,incubating,"3/23: one dead chick on the ground 3/29: mercury sampled chick that could have been from nest 56 4/6: chick in nest looks big and healthy 4/14: Big chick 4/21: pulled flag" +2023,hidden,56,greg,2023-03-09,,3,nestling,"3/23: one dead chick on the ground 3/29: mercury sampled chick that could have been from nest 56 4/6: chick in nest looks big and healthy 4/14: Big chick 4/21: pulled flag" +2023,hidden,56,greg,2023-03-16,,3,nestling,"3/23: one dead chick on the ground 3/29: mercury sampled chick that could have been from nest 56 4/6: chick in nest looks big and healthy 4/14: Big chick 4/21: pulled flag" +2023,hidden,56,greg,2023-03-23,,1,nestling,"3/23: one dead chick on the ground 3/29: mercury sampled chick that could have been from nest 56 4/6: chick in nest looks big and healthy 4/14: Big chick 4/21: pulled flag" +2023,hidden,56,greg,2023-03-29,,1,nestling,"3/23: one dead chick on the ground 3/29: mercury sampled chick that could have been from nest 56 4/6: chick in nest looks big and healthy 4/14: Big chick 4/21: pulled flag" +2023,hidden,56,greg,2023-04-06,,1,nestling,"3/23: one dead chick on the ground 3/29: mercury sampled chick that could have been from nest 56 4/6: chick in nest looks big and healthy 4/14: Big chick 4/21: pulled flag" +2023,hidden,56,greg,2023-04-14,,1,nestling,"3/23: one dead chick on the ground 3/29: mercury sampled chick that could have been from nest 56 4/6: chick in nest looks big and healthy 4/14: Big chick 4/21: pulled flag" +2023,hidden,56,greg,2023-04-21,,,empty,"3/23: one dead chick on the ground 3/29: mercury sampled chick that could have been from nest 56 4/6: chick in nest looks big and healthy 4/14: Big chick 4/21: pulled flag" +2023,hidden,56,greg,2023-04-28,,,,"3/23: one dead chick on the ground 3/29: mercury sampled chick that could have been from nest 56 4/6: chick in nest looks big and healthy 4/14: Big chick 4/21: pulled flag" +2023,hidden,56,greg,2023-05-05,,,,"3/23: one dead chick on the ground 3/29: mercury sampled chick that could have been from nest 56 4/6: chick in nest looks big and healthy 4/14: Big chick 4/21: pulled flag" +2023,hidden,38,greg,2023-02-16,3,,incubating,"2/23: one chick dry, one chick wet 3/9: 3 chicks certain 3/16: 2 live chicks and 1 dead chick in nest; 3/29: 1+ chicks 4/6: 1 chick plus 4/21: pulled flag" +2023,hidden,38,greg,2023-02-23,1,2,hatching,"2/23: one chick dry, one chick wet 3/9: 3 chicks certain 3/16: 2 live chicks and 1 dead chick in nest; 3/29: 1+ chicks 4/6: 1 chick plus 4/21: pulled flag" +2023,hidden,38,greg,2023-03-02,,3,nestling,"2/23: one chick dry, one chick wet 3/9: 3 chicks certain 3/16: 2 live chicks and 1 dead chick in nest; 3/29: 1+ chicks 4/6: 1 chick plus 4/21: pulled flag" +2023,hidden,38,greg,2023-03-09,,3,nestling,"2/23: one chick dry, one chick wet 3/9: 3 chicks certain 3/16: 2 live chicks and 1 dead chick in nest; 3/29: 1+ chicks 4/6: 1 chick plus 4/21: pulled flag" +2023,hidden,38,greg,2023-03-16,,2,nestling,"2/23: one chick dry, one chick wet 3/9: 3 chicks certain 3/16: 2 live chicks and 1 dead chick in nest; 3/29: 1+ chicks 4/6: 1 chick plus 4/21: pulled flag" +2023,hidden,38,greg,2023-03-23,,2,nestling,"2/23: one chick dry, one chick wet 3/9: 3 chicks certain 3/16: 2 live chicks and 1 dead chick in nest; 3/29: 1+ chicks 4/6: 1 chick plus 4/21: pulled flag" +2023,hidden,38,greg,2023-03-29,,1,nestling,"2/23: one chick dry, one chick wet 3/9: 3 chicks certain 3/16: 2 live chicks and 1 dead chick in nest; 3/29: 1+ chicks 4/6: 1 chick plus 4/21: pulled flag" +2023,hidden,38,greg,2023-04-06,,1,nestling,"2/23: one chick dry, one chick wet 3/9: 3 chicks certain 3/16: 2 live chicks and 1 dead chick in nest; 3/29: 1+ chicks 4/6: 1 chick plus 4/21: pulled flag" +2023,hidden,38,greg,2023-04-14,,1,nestling,"2/23: one chick dry, one chick wet 3/9: 3 chicks certain 3/16: 2 live chicks and 1 dead chick in nest; 3/29: 1+ chicks 4/6: 1 chick plus 4/21: pulled flag" +2023,hidden,38,greg,2023-04-21,,,empty,"2/23: one chick dry, one chick wet 3/9: 3 chicks certain 3/16: 2 live chicks and 1 dead chick in nest; 3/29: 1+ chicks 4/6: 1 chick plus 4/21: pulled flag" +2023,hidden,38,greg,2023-04-28,,,,"2/23: one chick dry, one chick wet 3/9: 3 chicks certain 3/16: 2 live chicks and 1 dead chick in nest; 3/29: 1+ chicks 4/6: 1 chick plus 4/21: pulled flag" +2023,hidden,38,greg,2023-05-05,,,,"2/23: one chick dry, one chick wet 3/9: 3 chicks certain 3/16: 2 live chicks and 1 dead chick in nest; 3/29: 1+ chicks 4/6: 1 chick plus 4/21: pulled flag" +2023,hidden,58,bcnh,2023-02-16,3,,incubating,"3/2: eggshell on ground 3/9: 2 chicks certain 3/16: certain only 1 chick in nest; 3/29: dead chick" +2023,hidden,58,bcnh,2023-02-23,3,,incubating,"3/2: eggshell on ground 3/9: 2 chicks certain 3/16: certain only 1 chick in nest; 3/29: dead chick" +2023,hidden,58,bcnh,2023-03-02,2,,incubating,"3/2: eggshell on ground 3/9: 2 chicks certain 3/16: certain only 1 chick in nest; 3/29: dead chick" +2023,hidden,58,bcnh,2023-03-09,,2,nestling,"3/2: eggshell on ground 3/9: 2 chicks certain 3/16: certain only 1 chick in nest; 3/29: dead chick" +2023,hidden,58,bcnh,2023-03-16,,1,nestling,"3/2: eggshell on ground 3/9: 2 chicks certain 3/16: certain only 1 chick in nest; 3/29: dead chick" +2023,hidden,58,bcnh,2023-03-23,,1,nestling,"3/2: eggshell on ground 3/9: 2 chicks certain 3/16: certain only 1 chick in nest; 3/29: dead chick" +2023,hidden,58,bcnh,2023-03-29,,,empty,"3/2: eggshell on ground 3/9: 2 chicks certain 3/16: certain only 1 chick in nest; 3/29: dead chick" +2023,hidden,58,bcnh,2023-04-06,,,empty,"3/2: eggshell on ground 3/9: 2 chicks certain 3/16: certain only 1 chick in nest; 3/29: dead chick" +2023,hidden,58,bcnh,2023-04-14,,,empty,"3/2: eggshell on ground 3/9: 2 chicks certain 3/16: certain only 1 chick in nest; 3/29: dead chick" +2023,hidden,58,bcnh,2023-04-21,,,empty,"3/2: eggshell on ground 3/9: 2 chicks certain 3/16: certain only 1 chick in nest; 3/29: dead chick" +2023,hidden,58,bcnh,2023-04-28,,,,"3/2: eggshell on ground 3/9: 2 chicks certain 3/16: certain only 1 chick in nest; 3/29: dead chick" +2023,hidden,58,bcnh,2023-05-05,,,,"3/2: eggshell on ground 3/9: 2 chicks certain 3/16: certain only 1 chick in nest; 3/29: dead chick" +2023,hidden,40,greg,2023-02-16,3,,incubating,"3/2: hard to see 3/16: 1 chick crawling out of nest 3/23: two dead chicks; 3/29: flag pulled" +2023,hidden,40,greg,2023-02-23,2,1,hatching,"3/2: hard to see 3/16: 1 chick crawling out of nest 3/23: two dead chicks; 3/29: flag pulled" +2023,hidden,40,greg,2023-03-02,,2,nestling,"3/2: hard to see 3/16: 1 chick crawling out of nest 3/23: two dead chicks; 3/29: flag pulled" +2023,hidden,40,greg,2023-03-09,,2,nestling,"3/2: hard to see 3/16: 1 chick crawling out of nest 3/23: two dead chicks; 3/29: flag pulled" +2023,hidden,40,greg,2023-03-16,,2,nestling,"3/2: hard to see 3/16: 1 chick crawling out of nest 3/23: two dead chicks; 3/29: flag pulled" +2023,hidden,40,greg,2023-03-23,,,empty,"3/2: hard to see 3/16: 1 chick crawling out of nest 3/23: two dead chicks; 3/29: flag pulled" +2023,hidden,40,greg,2023-03-29,,,pulled,"3/2: hard to see 3/16: 1 chick crawling out of nest 3/23: two dead chicks; 3/29: flag pulled" +2023,hidden,40,greg,2023-04-06,,,,"3/2: hard to see 3/16: 1 chick crawling out of nest 3/23: two dead chicks; 3/29: flag pulled" +2023,hidden,40,greg,2023-04-14,,,,"3/2: hard to see 3/16: 1 chick crawling out of nest 3/23: two dead chicks; 3/29: flag pulled" +2023,hidden,40,greg,2023-04-21,,,,"3/2: hard to see 3/16: 1 chick crawling out of nest 3/23: two dead chicks; 3/29: flag pulled" +2023,hidden,40,greg,2023-04-28,,,,"3/2: hard to see 3/16: 1 chick crawling out of nest 3/23: two dead chicks; 3/29: flag pulled" +2023,hidden,40,greg,2023-05-05,,,,"3/2: hard to see 3/16: 1 chick crawling out of nest 3/23: two dead chicks; 3/29: flag pulled" +2023,hidden,167,greg,2023-02-16,,,,"3/9: flagging found, but not nest 3/16: pulled flag, nest gone" +2023,hidden,167,greg,2023-02-23,2,,incubating,"3/9: flagging found, but not nest 3/16: pulled flag, nest gone" +2023,hidden,167,greg,2023-03-02,,,empty,"3/9: flagging found, but not nest 3/16: pulled flag, nest gone" +2023,hidden,167,greg,2023-03-09,,,empty,"3/9: flagging found, but not nest 3/16: pulled flag, nest gone" +2023,hidden,167,greg,2023-03-16,,,pulled,"3/9: flagging found, but not nest 3/16: pulled flag, nest gone" +2023,hidden,167,greg,2023-03-23,,,,"3/9: flagging found, but not nest 3/16: pulled flag, nest gone" +2023,hidden,167,greg,2023-03-29,,,,"3/9: flagging found, but not nest 3/16: pulled flag, nest gone" +2023,hidden,167,greg,2023-04-06,,,,"3/9: flagging found, but not nest 3/16: pulled flag, nest gone" +2023,hidden,167,greg,2023-04-14,,,,"3/9: flagging found, but not nest 3/16: pulled flag, nest gone" +2023,hidden,167,greg,2023-04-21,,,,"3/9: flagging found, but not nest 3/16: pulled flag, nest gone" +2023,hidden,167,greg,2023-04-28,,,,"3/9: flagging found, but not nest 3/16: pulled flag, nest gone" +2023,hidden,167,greg,2023-05-05,,,,"3/9: flagging found, but not nest 3/16: pulled flag, nest gone" +2023,hidden,120,greg,2023-02-16,,,,"3/16: certain 3 chicks 4/6: 1 dead chick in nest" +2023,hidden,120,greg,2023-02-23,3,,incubating,"3/16: certain 3 chicks 4/6: 1 dead chick in nest" +2023,hidden,120,greg,2023-03-02,3,,incubating,"3/16: certain 3 chicks 4/6: 1 dead chick in nest" +2023,hidden,120,greg,2023-03-09,,3,nestling,"3/16: certain 3 chicks 4/6: 1 dead chick in nest" +2023,hidden,120,greg,2023-03-16,,3,nestling,"3/16: certain 3 chicks 4/6: 1 dead chick in nest" +2023,hidden,120,greg,2023-03-23,,2,nestling,"3/16: certain 3 chicks 4/6: 1 dead chick in nest" +2023,hidden,120,greg,2023-03-29,,2,nestling,"3/16: certain 3 chicks 4/6: 1 dead chick in nest" +2023,hidden,120,greg,2023-04-06,,,empty,"3/16: certain 3 chicks 4/6: 1 dead chick in nest" +2023,hidden,120,greg,2023-04-14,,,empty,"3/16: certain 3 chicks 4/6: 1 dead chick in nest" +2023,hidden,120,greg,2023-04-21,,,empty,"3/16: certain 3 chicks 4/6: 1 dead chick in nest" +2023,hidden,120,greg,2023-04-28,,,,"3/16: certain 3 chicks 4/6: 1 dead chick in nest" +2023,hidden,120,greg,2023-05-05,,,,"3/16: certain 3 chicks 4/6: 1 dead chick in nest" +2023,hidden,31,bcnh,2023-02-16,2,,incubating,"3/9: nest gone, flag pulled" +2023,hidden,31,bcnh,2023-02-23,2,,incubating,"3/9: nest gone, flag pulled" +2023,hidden,31,bcnh,2023-03-02,,,empty,"3/9: nest gone, flag pulled" +2023,hidden,31,bcnh,2023-03-09,,,pulled,"3/9: nest gone, flag pulled" +2023,hidden,31,bcnh,2023-03-16,,,,"3/9: nest gone, flag pulled" +2023,hidden,31,bcnh,2023-03-23,,,,"3/9: nest gone, flag pulled" +2023,hidden,31,bcnh,2023-03-29,,,,"3/9: nest gone, flag pulled" +2023,hidden,31,bcnh,2023-04-06,,,,"3/9: nest gone, flag pulled" +2023,hidden,31,bcnh,2023-04-14,,,,"3/9: nest gone, flag pulled" +2023,hidden,31,bcnh,2023-04-21,,,,"3/9: nest gone, flag pulled" +2023,hidden,31,bcnh,2023-04-28,,,,"3/9: nest gone, flag pulled" +2023,hidden,31,bcnh,2023-05-05,,,,"3/9: nest gone, flag pulled" +2023,hidden,27,greg,2023-02-16,3,,incubating,"2/16: greg nest just above bcnh nest 31; 3/2: only 2 eggshells on ground 3/23: one dead chick in the nest, and one very weak chick on the ground--put back in nest" +2023,hidden,27,greg,2023-02-23,3,,incubating,"2/16: greg nest just above bcnh nest 31; 3/2: only 2 eggshells on ground 3/23: one dead chick in the nest, and one very weak chick on the ground--put back in nest" +2023,hidden,27,greg,2023-03-02,,2,nestling,"2/16: greg nest just above bcnh nest 31; 3/2: only 2 eggshells on ground 3/23: one dead chick in the nest, and one very weak chick on the ground--put back in nest" +2023,hidden,27,greg,2023-03-09,,2,nestling,"2/16: greg nest just above bcnh nest 31; 3/2: only 2 eggshells on ground 3/23: one dead chick in the nest, and one very weak chick on the ground--put back in nest" +2023,hidden,27,greg,2023-03-16,,2,nestling,"2/16: greg nest just above bcnh nest 31; 3/2: only 2 eggshells on ground 3/23: one dead chick in the nest, and one very weak chick on the ground--put back in nest" +2023,hidden,27,greg,2023-03-23,,1,nestling,"2/16: greg nest just above bcnh nest 31; 3/2: only 2 eggshells on ground 3/23: one dead chick in the nest, and one very weak chick on the ground--put back in nest" +2023,hidden,27,greg,2023-03-29,,,missed,"2/16: greg nest just above bcnh nest 31; 3/2: only 2 eggshells on ground 3/23: one dead chick in the nest, and one very weak chick on the ground--put back in nest" +2023,hidden,27,greg,2023-04-06,,,missed,"2/16: greg nest just above bcnh nest 31; 3/2: only 2 eggshells on ground 3/23: one dead chick in the nest, and one very weak chick on the ground--put back in nest" +2023,hidden,27,greg,2023-04-14,,,missed,"2/16: greg nest just above bcnh nest 31; 3/2: only 2 eggshells on ground 3/23: one dead chick in the nest, and one very weak chick on the ground--put back in nest" +2023,hidden,27,greg,2023-04-21,,,missed,"2/16: greg nest just above bcnh nest 31; 3/2: only 2 eggshells on ground 3/23: one dead chick in the nest, and one very weak chick on the ground--put back in nest" +2023,hidden,27,greg,2023-04-28,,,missed,"2/16: greg nest just above bcnh nest 31; 3/2: only 2 eggshells on ground 3/23: one dead chick in the nest, and one very weak chick on the ground--put back in nest" +2023,hidden,27,greg,2023-05-05,,,,"2/16: greg nest just above bcnh nest 31; 3/2: only 2 eggshells on ground 3/23: one dead chick in the nest, and one very weak chick on the ground--put back in nest" +2023,hidden,29,greg,2023-02-16,2,,incubating,"2/23: eggshell on ground 3/16: pulled flag, nest gone, eggshell on ground" +2023,hidden,29,greg,2023-02-23,,,empty,"2/23: eggshell on ground 3/16: pulled flag, nest gone, eggshell on ground" +2023,hidden,29,greg,2023-03-02,,,empty,"2/23: eggshell on ground 3/16: pulled flag, nest gone, eggshell on ground" +2023,hidden,29,greg,2023-03-09,2,,incubating,"2/23: eggshell on ground 3/16: pulled flag, nest gone, eggshell on ground" +2023,hidden,29,greg,2023-03-16,,,empty,"2/23: eggshell on ground 3/16: pulled flag, nest gone, eggshell on ground" +2023,hidden,29,greg,2023-03-23,,,,"2/23: eggshell on ground 3/16: pulled flag, nest gone, eggshell on ground" +2023,hidden,29,greg,2023-03-29,,,,"2/23: eggshell on ground 3/16: pulled flag, nest gone, eggshell on ground" +2023,hidden,29,greg,2023-04-06,,,,"2/23: eggshell on ground 3/16: pulled flag, nest gone, eggshell on ground" +2023,hidden,29,greg,2023-04-14,,,,"2/23: eggshell on ground 3/16: pulled flag, nest gone, eggshell on ground" +2023,hidden,29,greg,2023-04-21,,,,"2/23: eggshell on ground 3/16: pulled flag, nest gone, eggshell on ground" +2023,hidden,29,greg,2023-04-28,,,,"2/23: eggshell on ground 3/16: pulled flag, nest gone, eggshell on ground" +2023,hidden,29,greg,2023-05-05,,,,"2/23: eggshell on ground 3/16: pulled flag, nest gone, eggshell on ground" +2023,hidden,42,greg,2023-02-16,3,,incubating,"3/9: 3 chicks certain 3/16: certain 3 chicks" +2023,hidden,42,greg,2023-02-23,3,,incubating,"3/9: 3 chicks certain 3/16: certain 3 chicks" +2023,hidden,42,greg,2023-03-02,3,,incubating,"3/9: 3 chicks certain 3/16: certain 3 chicks" +2023,hidden,42,greg,2023-03-09,,3,nestling,"3/9: 3 chicks certain 3/16: certain 3 chicks" +2023,hidden,42,greg,2023-03-16,,3,nestling,"3/9: 3 chicks certain 3/16: certain 3 chicks" +2023,hidden,42,greg,2023-03-23,,2,nestling,"3/9: 3 chicks certain 3/16: certain 3 chicks" +2023,hidden,42,greg,2023-03-29,,2,nestling,"3/9: 3 chicks certain 3/16: certain 3 chicks" +2023,hidden,42,greg,2023-04-06,,2,nestling,"3/9: 3 chicks certain 3/16: certain 3 chicks" +2023,hidden,42,greg,2023-04-14,,,empty,"3/9: 3 chicks certain 3/16: certain 3 chicks" +2023,hidden,42,greg,2023-04-21,,,pulled,"3/9: 3 chicks certain 3/16: certain 3 chicks" +2023,hidden,42,greg,2023-04-28,,,,"3/9: 3 chicks certain 3/16: certain 3 chicks" +2023,hidden,42,greg,2023-05-05,,,,"3/9: 3 chicks certain 3/16: certain 3 chicks" +2023,hidden,60,greg,2023-02-16,2,,incubating,"2/16: nest up high; 3/29: 2 chicks certain 4/6: found smaller chick on ground (warm, feisty and fat, had been fed), replaced in nest 4/21: pulled flag" +2023,hidden,60,greg,2023-02-23,2,,incubating,"2/16: nest up high; 3/29: 2 chicks certain 4/6: found smaller chick on ground (warm, feisty and fat, had been fed), replaced in nest 4/21: pulled flag" +2023,hidden,60,greg,2023-03-02,2,,incubating,"2/16: nest up high; 3/29: 2 chicks certain 4/6: found smaller chick on ground (warm, feisty and fat, had been fed), replaced in nest 4/21: pulled flag" +2023,hidden,60,greg,2023-03-09,2,,incubating,"2/16: nest up high; 3/29: 2 chicks certain 4/6: found smaller chick on ground (warm, feisty and fat, had been fed), replaced in nest 4/21: pulled flag" +2023,hidden,60,greg,2023-03-16,,2,nestling,"2/16: nest up high; 3/29: 2 chicks certain 4/6: found smaller chick on ground (warm, feisty and fat, had been fed), replaced in nest 4/21: pulled flag" +2023,hidden,60,greg,2023-03-23,,1,nestling,"2/16: nest up high; 3/29: 2 chicks certain 4/6: found smaller chick on ground (warm, feisty and fat, had been fed), replaced in nest 4/21: pulled flag" +2023,hidden,60,greg,2023-03-29,,2,nestling,"2/16: nest up high; 3/29: 2 chicks certain 4/6: found smaller chick on ground (warm, feisty and fat, had been fed), replaced in nest 4/21: pulled flag" +2023,hidden,60,greg,2023-04-06,,2,nestling,"2/16: nest up high; 3/29: 2 chicks certain 4/6: found smaller chick on ground (warm, feisty and fat, had been fed), replaced in nest 4/21: pulled flag" +2023,hidden,60,greg,2023-04-14,,1,nestling,"2/16: nest up high; 3/29: 2 chicks certain 4/6: found smaller chick on ground (warm, feisty and fat, had been fed), replaced in nest 4/21: pulled flag" +2023,hidden,60,greg,2023-04-21,,,empty,"2/16: nest up high; 3/29: 2 chicks certain 4/6: found smaller chick on ground (warm, feisty and fat, had been fed), replaced in nest 4/21: pulled flag" +2023,hidden,60,greg,2023-04-28,,,,"2/16: nest up high; 3/29: 2 chicks certain 4/6: found smaller chick on ground (warm, feisty and fat, had been fed), replaced in nest 4/21: pulled flag" +2023,hidden,60,greg,2023-05-05,,,,"2/16: nest up high; 3/29: 2 chicks certain 4/6: found smaller chick on ground (warm, feisty and fat, had been fed), replaced in nest 4/21: pulled flag" +2023,hidden,62,greg,2023-02-16,2,,incubating,"3/9: chicks pretty big 4/6: really big chick; 4/21: Chick flew away" +2023,hidden,62,greg,2023-02-23,,2,nestling,"3/9: chicks pretty big 4/6: really big chick; 4/21: Chick flew away" +2023,hidden,62,greg,2023-03-02,,2,nestling,"3/9: chicks pretty big 4/6: really big chick; 4/21: Chick flew away" +2023,hidden,62,greg,2023-03-09,,2,nestling,"3/9: chicks pretty big 4/6: really big chick; 4/21: Chick flew away" +2023,hidden,62,greg,2023-03-16,,2,nestling,"3/9: chicks pretty big 4/6: really big chick; 4/21: Chick flew away" +2023,hidden,62,greg,2023-03-23,,2,nestling,"3/9: chicks pretty big 4/6: really big chick; 4/21: Chick flew away" +2023,hidden,62,greg,2023-03-29,,,empty,"3/9: chicks pretty big 4/6: really big chick; 4/21: Chick flew away" +2023,hidden,62,greg,2023-04-06,,1,nestling,"3/9: chicks pretty big 4/6: really big chick; 4/21: Chick flew away" +2023,hidden,62,greg,2023-04-14,,,empty,"3/9: chicks pretty big 4/6: really big chick; 4/21: Chick flew away" +2023,hidden,62,greg,2023-04-21,,,empty,"3/9: chicks pretty big 4/6: really big chick; 4/21: Chick flew away" +2023,hidden,62,greg,2023-04-28,,,pulled,"3/9: chicks pretty big 4/6: really big chick; 4/21: Chick flew away" +2023,hidden,62,greg,2023-05-05,,,,"3/9: chicks pretty big 4/6: really big chick; 4/21: Chick flew away" +2023,hidden,122,greg,2023-02-16,,,,"3/9: nest gone, flag pulled" +2023,hidden,122,greg,2023-02-23,2,,incubating,"3/9: nest gone, flag pulled" +2023,hidden,122,greg,2023-03-02,2,,incubating,"3/9: nest gone, flag pulled" +2023,hidden,122,greg,2023-03-09,,,pulled,"3/9: nest gone, flag pulled" +2023,hidden,122,greg,2023-03-16,,,,"3/9: nest gone, flag pulled" +2023,hidden,122,greg,2023-03-23,,,,"3/9: nest gone, flag pulled" +2023,hidden,122,greg,2023-03-29,,,,"3/9: nest gone, flag pulled" +2023,hidden,122,greg,2023-04-06,,,,"3/9: nest gone, flag pulled" +2023,hidden,122,greg,2023-04-14,,,,"3/9: nest gone, flag pulled" +2023,hidden,122,greg,2023-04-21,,,,"3/9: nest gone, flag pulled" +2023,hidden,122,greg,2023-04-28,,,,"3/9: nest gone, flag pulled" +2023,hidden,122,greg,2023-05-05,,,,"3/9: nest gone, flag pulled" +2023,hidden,169,greg,2023-02-16,,,,"2/23: one egg tiny 3/16: nest looks more like bcnh on this check 3/23: nest empty, flag pulled" +2023,hidden,169,greg,2023-02-23,3,,incubating,"2/23: one egg tiny 3/16: nest looks more like bcnh on this check 3/23: nest empty, flag pulled" +2023,hidden,169,greg,2023-03-02,3,,incubating,"2/23: one egg tiny 3/16: nest looks more like bcnh on this check 3/23: nest empty, flag pulled" +2023,hidden,169,greg,2023-03-09,3,,incubating,"2/23: one egg tiny 3/16: nest looks more like bcnh on this check 3/23: nest empty, flag pulled" +2023,hidden,169,greg,2023-03-16,,,empty,"2/23: one egg tiny 3/16: nest looks more like bcnh on this check 3/23: nest empty, flag pulled" +2023,hidden,169,greg,2023-03-23,,,pulled,"2/23: one egg tiny 3/16: nest looks more like bcnh on this check 3/23: nest empty, flag pulled" +2023,hidden,169,greg,2023-03-29,,,,"2/23: one egg tiny 3/16: nest looks more like bcnh on this check 3/23: nest empty, flag pulled" +2023,hidden,169,greg,2023-04-06,,,,"2/23: one egg tiny 3/16: nest looks more like bcnh on this check 3/23: nest empty, flag pulled" +2023,hidden,169,greg,2023-04-14,,,,"2/23: one egg tiny 3/16: nest looks more like bcnh on this check 3/23: nest empty, flag pulled" +2023,hidden,169,greg,2023-04-21,,,,"2/23: one egg tiny 3/16: nest looks more like bcnh on this check 3/23: nest empty, flag pulled" +2023,hidden,169,greg,2023-04-28,,,,"2/23: one egg tiny 3/16: nest looks more like bcnh on this check 3/23: nest empty, flag pulled" +2023,hidden,169,greg,2023-05-05,,,,"2/23: one egg tiny 3/16: nest looks more like bcnh on this check 3/23: nest empty, flag pulled" +2023,hidden,124,greg,2023-02-16,,,,"39: 2 chicks certain, 4/6: dead chick below nest 4/14: saw a big chick near nest from far away" +2023,hidden,124,greg,2023-02-23,2,,incubating,"39: 2 chicks certain, 4/6: dead chick below nest 4/14: saw a big chick near nest from far away" +2023,hidden,124,greg,2023-03-02,,2,nestling,"39: 2 chicks certain, 4/6: dead chick below nest 4/14: saw a big chick near nest from far away" +2023,hidden,124,greg,2023-03-09,,2,nestling,"39: 2 chicks certain, 4/6: dead chick below nest 4/14: saw a big chick near nest from far away" +2023,hidden,124,greg,2023-03-16,,2,nestling,"39: 2 chicks certain, 4/6: dead chick below nest 4/14: saw a big chick near nest from far away" +2023,hidden,124,greg,2023-03-23,,2,nestling,"39: 2 chicks certain, 4/6: dead chick below nest 4/14: saw a big chick near nest from far away" +2023,hidden,124,greg,2023-03-29,,,empty,"39: 2 chicks certain, 4/6: dead chick below nest 4/14: saw a big chick near nest from far away" +2023,hidden,124,greg,2023-04-06,,,empty,"39: 2 chicks certain, 4/6: dead chick below nest 4/14: saw a big chick near nest from far away" +2023,hidden,124,greg,2023-04-14,,,empty,"39: 2 chicks certain, 4/6: dead chick below nest 4/14: saw a big chick near nest from far away" +2023,hidden,124,greg,2023-04-21,,,empty,"39: 2 chicks certain, 4/6: dead chick below nest 4/14: saw a big chick near nest from far away" +2023,hidden,124,greg,2023-04-28,,,pulled,"39: 2 chicks certain, 4/6: dead chick below nest 4/14: saw a big chick near nest from far away" +2023,hidden,124,greg,2023-05-05,,,,"39: 2 chicks certain, 4/6: dead chick below nest 4/14: saw a big chick near nest from far away" +2023,hidden,171,greg,2023-02-16,,,,"3/9: Egg looks dead 3/16: certain only 1 chick 3/23: dead egg still in nest 3/29: one dead egg 4/14: 1 big chick nearby" +2023,hidden,171,greg,2023-02-23,2,,incubating,"3/9: Egg looks dead 3/16: certain only 1 chick 3/23: dead egg still in nest 3/29: one dead egg 4/14: 1 big chick nearby" +2023,hidden,171,greg,2023-03-02,1,1,wet_chick,"3/9: Egg looks dead 3/16: certain only 1 chick 3/23: dead egg still in nest 3/29: one dead egg 4/14: 1 big chick nearby" +2023,hidden,171,greg,2023-03-09,1,1,hatching,"3/9: Egg looks dead 3/16: certain only 1 chick 3/23: dead egg still in nest 3/29: one dead egg 4/14: 1 big chick nearby" +2023,hidden,171,greg,2023-03-16,,1,nestling,"3/9: Egg looks dead 3/16: certain only 1 chick 3/23: dead egg still in nest 3/29: one dead egg 4/14: 1 big chick nearby" +2023,hidden,171,greg,2023-03-23,,1,nestling,"3/9: Egg looks dead 3/16: certain only 1 chick 3/23: dead egg still in nest 3/29: one dead egg 4/14: 1 big chick nearby" +2023,hidden,171,greg,2023-03-29,,1,nestling,"3/9: Egg looks dead 3/16: certain only 1 chick 3/23: dead egg still in nest 3/29: one dead egg 4/14: 1 big chick nearby" +2023,hidden,171,greg,2023-04-06,,,empty,"3/9: Egg looks dead 3/16: certain only 1 chick 3/23: dead egg still in nest 3/29: one dead egg 4/14: 1 big chick nearby" +2023,hidden,171,greg,2023-04-14,,,empty,"3/9: Egg looks dead 3/16: certain only 1 chick 3/23: dead egg still in nest 3/29: one dead egg 4/14: 1 big chick nearby" +2023,hidden,171,greg,2023-04-21,,,empty,"3/9: Egg looks dead 3/16: certain only 1 chick 3/23: dead egg still in nest 3/29: one dead egg 4/14: 1 big chick nearby" +2023,hidden,171,greg,2023-04-28,,,missed,"3/9: Egg looks dead 3/16: certain only 1 chick 3/23: dead egg still in nest 3/29: one dead egg 4/14: 1 big chick nearby" +2023,hidden,171,greg,2023-05-05,,,empty,"3/9: Egg looks dead 3/16: certain only 1 chick 3/23: dead egg still in nest 3/29: one dead egg 4/14: 1 big chick nearby" +2023,hidden,64,greg,2023-02-16,3,,incubating,"3/9: Possible dead chick found; 3/29: nest gone, flag pulled" +2023,hidden,64,greg,2023-02-23,3,,incubating,"3/9: Possible dead chick found; 3/29: nest gone, flag pulled" +2023,hidden,64,greg,2023-03-02,,3,nestling,"3/9: Possible dead chick found; 3/29: nest gone, flag pulled" +2023,hidden,64,greg,2023-03-09,,2,nestling,"3/9: Possible dead chick found; 3/29: nest gone, flag pulled" +2023,hidden,64,greg,2023-03-16,,2,nestling,"3/9: Possible dead chick found; 3/29: nest gone, flag pulled" +2023,hidden,64,greg,2023-03-23,,,empty,"3/9: Possible dead chick found; 3/29: nest gone, flag pulled" +2023,hidden,64,greg,2023-03-29,,,pulled,"3/9: Possible dead chick found; 3/29: nest gone, flag pulled" +2023,hidden,64,greg,2023-04-06,,,,"3/9: Possible dead chick found; 3/29: nest gone, flag pulled" +2023,hidden,64,greg,2023-04-14,,,,"3/9: Possible dead chick found; 3/29: nest gone, flag pulled" +2023,hidden,64,greg,2023-04-21,,,,"3/9: Possible dead chick found; 3/29: nest gone, flag pulled" +2023,hidden,64,greg,2023-04-28,,,,"3/9: Possible dead chick found; 3/29: nest gone, flag pulled" +2023,hidden,64,greg,2023-05-05,,,,"3/9: Possible dead chick found; 3/29: nest gone, flag pulled" +2023,hidden,35,greg,2023-02-16,2,,incubating,"3/16: pulled flag, nest gone, eggshell on ground" +2023,hidden,35,greg,2023-02-23,2,,incubating,"3/16: pulled flag, nest gone, eggshell on ground" +2023,hidden,35,greg,2023-03-02,2,,incubating,"3/16: pulled flag, nest gone, eggshell on ground" +2023,hidden,35,greg,2023-03-09,,,empty,"3/16: pulled flag, nest gone, eggshell on ground" +2023,hidden,35,greg,2023-03-16,,,pulled,"3/16: pulled flag, nest gone, eggshell on ground" +2023,hidden,35,greg,2023-03-23,,,,"3/16: pulled flag, nest gone, eggshell on ground" +2023,hidden,35,greg,2023-03-29,,,,"3/16: pulled flag, nest gone, eggshell on ground" +2023,hidden,35,greg,2023-04-06,,,,"3/16: pulled flag, nest gone, eggshell on ground" +2023,hidden,35,greg,2023-04-14,,,,"3/16: pulled flag, nest gone, eggshell on ground" +2023,hidden,35,greg,2023-04-21,,,,"3/16: pulled flag, nest gone, eggshell on ground" +2023,hidden,35,greg,2023-04-28,,,,"3/16: pulled flag, nest gone, eggshell on ground" +2023,hidden,35,greg,2023-05-05,,,,"3/16: pulled flag, nest gone, eggshell on ground" +2023,hidden,37,greg,2023-02-16,2,,incubating,"3/9: 1 wet, 1 damp chick 4/14: 1 old dead chick in nest, 1 big chick far away" +2023,hidden,37,greg,2023-02-23,2,,incubating,"3/9: 1 wet, 1 damp chick 4/14: 1 old dead chick in nest, 1 big chick far away" +2023,hidden,37,greg,2023-03-02,2,,incubating,"3/9: 1 wet, 1 damp chick 4/14: 1 old dead chick in nest, 1 big chick far away" +2023,hidden,37,greg,2023-03-09,,2,wet_chick,"3/9: 1 wet, 1 damp chick 4/14: 1 old dead chick in nest, 1 big chick far away" +2023,hidden,37,greg,2023-03-16,,2,nestling,"3/9: 1 wet, 1 damp chick 4/14: 1 old dead chick in nest, 1 big chick far away" +2023,hidden,37,greg,2023-03-23,,2,nestling,"3/9: 1 wet, 1 damp chick 4/14: 1 old dead chick in nest, 1 big chick far away" +2023,hidden,37,greg,2023-03-29,,2,nestling,"3/9: 1 wet, 1 damp chick 4/14: 1 old dead chick in nest, 1 big chick far away" +2023,hidden,37,greg,2023-04-06,,2,nestling,"3/9: 1 wet, 1 damp chick 4/14: 1 old dead chick in nest, 1 big chick far away" +2023,hidden,37,greg,2023-04-14,,,empty,"3/9: 1 wet, 1 damp chick 4/14: 1 old dead chick in nest, 1 big chick far away" +2023,hidden,37,greg,2023-04-21,,,empty,"3/9: 1 wet, 1 damp chick 4/14: 1 old dead chick in nest, 1 big chick far away" +2023,hidden,37,greg,2023-04-28,,,,"3/9: 1 wet, 1 damp chick 4/14: 1 old dead chick in nest, 1 big chick far away" +2023,hidden,37,greg,2023-05-05,,,,"3/9: 1 wet, 1 damp chick 4/14: 1 old dead chick in nest, 1 big chick far away" +2023,hidden,39,greg,2023-02-16,3,,incubating,"3/9: nest gone, flag pulled" +2023,hidden,39,greg,2023-02-23,3,,incubating,"3/9: nest gone, flag pulled" +2023,hidden,39,greg,2023-03-02,,,empty,"3/9: nest gone, flag pulled" +2023,hidden,39,greg,2023-03-09,,,pulled,"3/9: nest gone, flag pulled" +2023,hidden,39,greg,2023-03-16,,,,"3/9: nest gone, flag pulled" +2023,hidden,39,greg,2023-03-23,,,,"3/9: nest gone, flag pulled" +2023,hidden,39,greg,2023-03-29,,,,"3/9: nest gone, flag pulled" +2023,hidden,39,greg,2023-04-06,,,,"3/9: nest gone, flag pulled" +2023,hidden,39,greg,2023-04-14,,,,"3/9: nest gone, flag pulled" +2023,hidden,39,greg,2023-04-21,,,,"3/9: nest gone, flag pulled" +2023,hidden,39,greg,2023-04-28,,,,"3/9: nest gone, flag pulled" +2023,hidden,39,greg,2023-05-05,,,,"3/9: nest gone, flag pulled" +2023,hidden,126,greg,2023-02-16,,,,"2/23: chick wet 3/2: hard to look into, up high 3/16: 1 live chick and 1 dead chick in nest, bigger chick also climbing around nearby in canopy but can't confirm it's from 126" +2023,hidden,126,greg,2023-02-23,2,1,wet_chick,"2/23: chick wet 3/2: hard to look into, up high 3/16: 1 live chick and 1 dead chick in nest, bigger chick also climbing around nearby in canopy but can't confirm it's from 126" +2023,hidden,126,greg,2023-03-02,,3,nestling,"2/23: chick wet 3/2: hard to look into, up high 3/16: 1 live chick and 1 dead chick in nest, bigger chick also climbing around nearby in canopy but can't confirm it's from 126" +2023,hidden,126,greg,2023-03-09,,2,nestling,"2/23: chick wet 3/2: hard to look into, up high 3/16: 1 live chick and 1 dead chick in nest, bigger chick also climbing around nearby in canopy but can't confirm it's from 126" +2023,hidden,126,greg,2023-03-16,,1,nestling,"2/23: chick wet 3/2: hard to look into, up high 3/16: 1 live chick and 1 dead chick in nest, bigger chick also climbing around nearby in canopy but can't confirm it's from 126" +2023,hidden,126,greg,2023-03-23,,,empty,"2/23: chick wet 3/2: hard to look into, up high 3/16: 1 live chick and 1 dead chick in nest, bigger chick also climbing around nearby in canopy but can't confirm it's from 126" +2023,hidden,126,greg,2023-03-29,,,,"2/23: chick wet 3/2: hard to look into, up high 3/16: 1 live chick and 1 dead chick in nest, bigger chick also climbing around nearby in canopy but can't confirm it's from 126" +2023,hidden,126,greg,2023-04-06,,,,"2/23: chick wet 3/2: hard to look into, up high 3/16: 1 live chick and 1 dead chick in nest, bigger chick also climbing around nearby in canopy but can't confirm it's from 126" +2023,hidden,126,greg,2023-04-14,,,empty,"2/23: chick wet 3/2: hard to look into, up high 3/16: 1 live chick and 1 dead chick in nest, bigger chick also climbing around nearby in canopy but can't confirm it's from 126" +2023,hidden,126,greg,2023-04-21,,,pulled,"2/23: chick wet 3/2: hard to look into, up high 3/16: 1 live chick and 1 dead chick in nest, bigger chick also climbing around nearby in canopy but can't confirm it's from 126" +2023,hidden,126,greg,2023-04-28,,,,"2/23: chick wet 3/2: hard to look into, up high 3/16: 1 live chick and 1 dead chick in nest, bigger chick also climbing around nearby in canopy but can't confirm it's from 126" +2023,hidden,126,greg,2023-05-05,,,,"2/23: chick wet 3/2: hard to look into, up high 3/16: 1 live chick and 1 dead chick in nest, bigger chick also climbing around nearby in canopy but can't confirm it's from 126" +2023,hidden,66,bcnh,2023-02-16,3,,incubating,"2/16: unsure if bcnh 3/16: pulled flag, nest gone" +2023,hidden,66,bcnh,2023-02-23,3,,incubating,"2/16: unsure if bcnh 3/16: pulled flag, nest gone" +2023,hidden,66,bcnh,2023-03-02,3,,incubating,"2/16: unsure if bcnh 3/16: pulled flag, nest gone" +2023,hidden,66,bcnh,2023-03-09,,,empty,"2/16: unsure if bcnh 3/16: pulled flag, nest gone" +2023,hidden,66,bcnh,2023-03-16,,,pulled,"2/16: unsure if bcnh 3/16: pulled flag, nest gone" +2023,hidden,66,bcnh,2023-03-23,,,,"2/16: unsure if bcnh 3/16: pulled flag, nest gone" +2023,hidden,66,bcnh,2023-03-29,,,,"2/16: unsure if bcnh 3/16: pulled flag, nest gone" +2023,hidden,66,bcnh,2023-04-06,,,,"2/16: unsure if bcnh 3/16: pulled flag, nest gone" +2023,hidden,66,bcnh,2023-04-14,,,,"2/16: unsure if bcnh 3/16: pulled flag, nest gone" +2023,hidden,66,bcnh,2023-04-21,,,,"2/16: unsure if bcnh 3/16: pulled flag, nest gone" +2023,hidden,66,bcnh,2023-04-28,,,,"2/16: unsure if bcnh 3/16: pulled flag, nest gone" +2023,hidden,66,bcnh,2023-05-05,,,,"2/16: unsure if bcnh 3/16: pulled flag, nest gone" +2023,hidden,173,greg,2023-02-16,,,,"2/23: nest up high; 3/2: nest gone, pulled flag" +2023,hidden,173,greg,2023-02-23,2,,incubating,"2/23: nest up high; 3/2: nest gone, pulled flag" +2023,hidden,173,greg,2023-03-02,,,empty,"2/23: nest up high; 3/2: nest gone, pulled flag" +2023,hidden,173,greg,2023-03-09,,,,"2/23: nest up high; 3/2: nest gone, pulled flag" +2023,hidden,173,greg,2023-03-16,,,,"2/23: nest up high; 3/2: nest gone, pulled flag" +2023,hidden,173,greg,2023-03-23,,,,"2/23: nest up high; 3/2: nest gone, pulled flag" +2023,hidden,173,greg,2023-03-29,,,,"2/23: nest up high; 3/2: nest gone, pulled flag" +2023,hidden,173,greg,2023-04-06,,,,"2/23: nest up high; 3/2: nest gone, pulled flag" +2023,hidden,173,greg,2023-04-14,,,,"2/23: nest up high; 3/2: nest gone, pulled flag" +2023,hidden,173,greg,2023-04-21,,,,"2/23: nest up high; 3/2: nest gone, pulled flag" +2023,hidden,173,greg,2023-04-28,,,,"2/23: nest up high; 3/2: nest gone, pulled flag" +2023,hidden,173,greg,2023-05-05,,,,"2/23: nest up high; 3/2: nest gone, pulled flag" +2023,hidden,175,greg,2023-02-16,,,,"3/2 nest gone, pulled flag" +2023,hidden,175,greg,2023-02-23,3,,incubating,"3/2 nest gone, pulled flag" +2023,hidden,175,greg,2023-03-02,,,empty,"3/2 nest gone, pulled flag" +2023,hidden,175,greg,2023-03-09,,,,"3/2 nest gone, pulled flag" +2023,hidden,175,greg,2023-03-16,,,,"3/2 nest gone, pulled flag" +2023,hidden,175,greg,2023-03-23,,,,"3/2 nest gone, pulled flag" +2023,hidden,175,greg,2023-03-29,,,,"3/2 nest gone, pulled flag" +2023,hidden,175,greg,2023-04-06,,,,"3/2 nest gone, pulled flag" +2023,hidden,175,greg,2023-04-14,,,,"3/2 nest gone, pulled flag" +2023,hidden,175,greg,2023-04-21,,,,"3/2 nest gone, pulled flag" +2023,hidden,175,greg,2023-04-28,,,,"3/2 nest gone, pulled flag" +2023,hidden,175,greg,2023-05-05,,,,"3/2 nest gone, pulled flag" +2023,hidden,68,greg,2023-02-16,2,,incubating,"3/9 ROSP takeover" +2023,hidden,68,greg,2023-02-23,2,,incubating,"3/9 ROSP takeover" +2023,hidden,68,greg,2023-03-02,,,empty,"3/9 ROSP takeover" +2023,hidden,68,greg,2023-03-09,,,,"3/9 ROSP takeover" +2023,hidden,68,greg,2023-03-16,,,,"3/9 ROSP takeover" +2023,hidden,68,greg,2023-03-23,,,,"3/9 ROSP takeover" +2023,hidden,68,greg,2023-03-29,,,,"3/9 ROSP takeover" +2023,hidden,68,greg,2023-04-06,,,,"3/9 ROSP takeover" +2023,hidden,68,greg,2023-04-14,,,,"3/9 ROSP takeover" +2023,hidden,68,greg,2023-04-21,,,,"3/9 ROSP takeover" +2023,hidden,68,greg,2023-04-28,,,,"3/9 ROSP takeover" +2023,hidden,68,greg,2023-05-05,,,,"3/9 ROSP takeover" +2023,hidden,*68,rosp,2023-02-16,,,,"3/9 ROSP takeove; 3/29: chicks dry 4/21: flag pulled" +2023,hidden,*68,rosp,2023-02-23,,,,"3/9 ROSP takeove; 3/29: chicks dry 4/21: flag pulled" +2023,hidden,*68,rosp,2023-03-02,,,,"3/9 ROSP takeove; 3/29: chicks dry 4/21: flag pulled" +2023,hidden,*68,rosp,2023-03-09,3,,incubating,"3/9 ROSP takeove; 3/29: chicks dry 4/21: flag pulled" +2023,hidden,*68,rosp,2023-03-16,3,,incubating,"3/9 ROSP takeove; 3/29: chicks dry 4/21: flag pulled" +2023,hidden,*68,rosp,2023-03-23,3,,incubating,"3/9 ROSP takeove; 3/29: chicks dry 4/21: flag pulled" +2023,hidden,*68,rosp,2023-03-29,1,2,chick_dry,"3/9 ROSP takeove; 3/29: chicks dry 4/21: flag pulled" +2023,hidden,*68,rosp,2023-04-06,,2,nestling,"3/9 ROSP takeove; 3/29: chicks dry 4/21: flag pulled" +2023,hidden,*68,rosp,2023-04-14,,2,nestling,"3/9 ROSP takeove; 3/29: chicks dry 4/21: flag pulled" +2023,hidden,*68,rosp,2023-04-21,,,empty,"3/9 ROSP takeove; 3/29: chicks dry 4/21: flag pulled" +2023,hidden,*68,rosp,2023-04-28,,,,"3/9 ROSP takeove; 3/29: chicks dry 4/21: flag pulled" +2023,hidden,*68,rosp,2023-05-05,,,,"3/9 ROSP takeove; 3/29: chicks dry 4/21: flag pulled" +2023,hidden,33,greg,2023-02-16,3,,incubating,"2/16: nest up high 3/16: certain 3 chicks visible now 3/23: one chick dead in the nest, one chick on the ground that appeared recently fallen, with bloody nares. Put back in the nest 4/6: pulled flag" +2023,hidden,33,greg,2023-02-23,3,,incubating,"2/16: nest up high 3/16: certain 3 chicks visible now 3/23: one chick dead in the nest, one chick on the ground that appeared recently fallen, with bloody nares. Put back in the nest 4/6: pulled flag" +2023,hidden,33,greg,2023-03-02,3,,incubating,"2/16: nest up high 3/16: certain 3 chicks visible now 3/23: one chick dead in the nest, one chick on the ground that appeared recently fallen, with bloody nares. Put back in the nest 4/6: pulled flag" +2023,hidden,33,greg,2023-03-09,,2,nestling,"2/16: nest up high 3/16: certain 3 chicks visible now 3/23: one chick dead in the nest, one chick on the ground that appeared recently fallen, with bloody nares. Put back in the nest 4/6: pulled flag" +2023,hidden,33,greg,2023-03-16,,3,nestling,"2/16: nest up high 3/16: certain 3 chicks visible now 3/23: one chick dead in the nest, one chick on the ground that appeared recently fallen, with bloody nares. Put back in the nest 4/6: pulled flag" +2023,hidden,33,greg,2023-03-23,,1,nestling,"2/16: nest up high 3/16: certain 3 chicks visible now 3/23: one chick dead in the nest, one chick on the ground that appeared recently fallen, with bloody nares. Put back in the nest 4/6: pulled flag" +2023,hidden,33,greg,2023-03-29,,,empty,"2/16: nest up high 3/16: certain 3 chicks visible now 3/23: one chick dead in the nest, one chick on the ground that appeared recently fallen, with bloody nares. Put back in the nest 4/6: pulled flag" +2023,hidden,33,greg,2023-04-06,,,pulled,"2/16: nest up high 3/16: certain 3 chicks visible now 3/23: one chick dead in the nest, one chick on the ground that appeared recently fallen, with bloody nares. Put back in the nest 4/6: pulled flag" +2023,hidden,33,greg,2023-04-14,,,,"2/16: nest up high 3/16: certain 3 chicks visible now 3/23: one chick dead in the nest, one chick on the ground that appeared recently fallen, with bloody nares. Put back in the nest 4/6: pulled flag" +2023,hidden,33,greg,2023-04-21,,,,"2/16: nest up high 3/16: certain 3 chicks visible now 3/23: one chick dead in the nest, one chick on the ground that appeared recently fallen, with bloody nares. Put back in the nest 4/6: pulled flag" +2023,hidden,33,greg,2023-04-28,,,,"2/16: nest up high 3/16: certain 3 chicks visible now 3/23: one chick dead in the nest, one chick on the ground that appeared recently fallen, with bloody nares. Put back in the nest 4/6: pulled flag" +2023,hidden,33,greg,2023-05-05,,,,"2/16: nest up high 3/16: certain 3 chicks visible now 3/23: one chick dead in the nest, one chick on the ground that appeared recently fallen, with bloody nares. Put back in the nest 4/6: pulled flag" +2023,hidden,128,greg,2023-02-16,,,,"3/9: one chick dry, one chick wet 3/23: one random third chick near nest, could be from 50 4/6: mercury sample from smaller chick 4/14: 1 chick plus" +2023,hidden,128,greg,2023-02-23,2,,incubating,"3/9: one chick dry, one chick wet 3/23: one random third chick near nest, could be from 50 4/6: mercury sample from smaller chick 4/14: 1 chick plus" +2023,hidden,128,greg,2023-03-02,2,,incubating,"3/9: one chick dry, one chick wet 3/23: one random third chick near nest, could be from 50 4/6: mercury sample from smaller chick 4/14: 1 chick plus" +2023,hidden,128,greg,2023-03-09,,2,wet_chick,"3/9: one chick dry, one chick wet 3/23: one random third chick near nest, could be from 50 4/6: mercury sample from smaller chick 4/14: 1 chick plus" +2023,hidden,128,greg,2023-03-16,,,missed,"3/9: one chick dry, one chick wet 3/23: one random third chick near nest, could be from 50 4/6: mercury sample from smaller chick 4/14: 1 chick plus" +2023,hidden,128,greg,2023-03-23,,2,nestling,"3/9: one chick dry, one chick wet 3/23: one random third chick near nest, could be from 50 4/6: mercury sample from smaller chick 4/14: 1 chick plus" +2023,hidden,128,greg,2023-03-29,,2,nestling,"3/9: one chick dry, one chick wet 3/23: one random third chick near nest, could be from 50 4/6: mercury sample from smaller chick 4/14: 1 chick plus" +2023,hidden,128,greg,2023-04-06,,2,nestling,"3/9: one chick dry, one chick wet 3/23: one random third chick near nest, could be from 50 4/6: mercury sample from smaller chick 4/14: 1 chick plus" +2023,hidden,128,greg,2023-04-14,,1,nestling,"3/9: one chick dry, one chick wet 3/23: one random third chick near nest, could be from 50 4/6: mercury sample from smaller chick 4/14: 1 chick plus" +2023,hidden,128,greg,2023-04-21,,1,branchling,"3/9: one chick dry, one chick wet 3/23: one random third chick near nest, could be from 50 4/6: mercury sample from smaller chick 4/14: 1 chick plus" +2023,hidden,128,greg,2023-04-28,,,missed,"3/9: one chick dry, one chick wet 3/23: one random third chick near nest, could be from 50 4/6: mercury sample from smaller chick 4/14: 1 chick plus" +2023,hidden,128,greg,2023-05-05,,,,"3/9: one chick dry, one chick wet 3/23: one random third chick near nest, could be from 50 4/6: mercury sample from smaller chick 4/14: 1 chick plus" +2023,hidden,70,greg,2023-02-16,2,,incubating,"2/23: eggshells on ground 3/9: pulled flag, nest gone" +2023,hidden,70,greg,2023-02-23,,,empty,"2/23: eggshells on ground 3/9: pulled flag, nest gone" +2023,hidden,70,greg,2023-03-02,,,empty,"2/23: eggshells on ground 3/9: pulled flag, nest gone" +2023,hidden,70,greg,2023-03-09,,,pulled,"2/23: eggshells on ground 3/9: pulled flag, nest gone" +2023,hidden,70,greg,2023-03-16,,,,"2/23: eggshells on ground 3/9: pulled flag, nest gone" +2023,hidden,70,greg,2023-03-23,,,,"2/23: eggshells on ground 3/9: pulled flag, nest gone" +2023,hidden,70,greg,2023-03-29,,,,"2/23: eggshells on ground 3/9: pulled flag, nest gone" +2023,hidden,70,greg,2023-04-06,,,,"2/23: eggshells on ground 3/9: pulled flag, nest gone" +2023,hidden,70,greg,2023-04-14,,,,"2/23: eggshells on ground 3/9: pulled flag, nest gone" +2023,hidden,70,greg,2023-04-21,,,,"2/23: eggshells on ground 3/9: pulled flag, nest gone" +2023,hidden,70,greg,2023-04-28,,,,"2/23: eggshells on ground 3/9: pulled flag, nest gone" +2023,hidden,70,greg,2023-05-05,,,,"2/23: eggshells on ground 3/9: pulled flag, nest gone" +2023,hidden,177,greg,2023-02-16,,,,"3/2 nest gone, pulled flagging" +2023,hidden,177,greg,2023-02-23,3,,incubating,"3/2 nest gone, pulled flagging" +2023,hidden,177,greg,2023-03-02,,,empty,"3/2 nest gone, pulled flagging" +2023,hidden,177,greg,2023-03-09,,,,"3/2 nest gone, pulled flagging" +2023,hidden,177,greg,2023-03-16,,,,"3/2 nest gone, pulled flagging" +2023,hidden,177,greg,2023-03-23,,,,"3/2 nest gone, pulled flagging" +2023,hidden,177,greg,2023-03-29,,,,"3/2 nest gone, pulled flagging" +2023,hidden,177,greg,2023-04-06,,,,"3/2 nest gone, pulled flagging" +2023,hidden,177,greg,2023-04-14,,,,"3/2 nest gone, pulled flagging" +2023,hidden,177,greg,2023-04-21,,,,"3/2 nest gone, pulled flagging" +2023,hidden,177,greg,2023-04-28,,,,"3/2 nest gone, pulled flagging" +2023,hidden,177,greg,2023-05-05,,,,"3/2 nest gone, pulled flagging" +2023,hidden,179,greg,2023-02-16,,,,"3/2: hard to see from transect, far to left, turn before 21. 333 next to 179 3/9: egg small" +2023,hidden,179,greg,2023-02-23,2,,incubating,"3/2: hard to see from transect, far to left, turn before 21. 333 next to 179 3/9: egg small" +2023,hidden,179,greg,2023-03-02,2,,incubating,"3/2: hard to see from transect, far to left, turn before 21. 333 next to 179 3/9: egg small" +2023,hidden,179,greg,2023-03-09,1,,incubating,"3/2: hard to see from transect, far to left, turn before 21. 333 next to 179 3/9: egg small" +2023,hidden,179,greg,2023-03-16,,,missed,"3/2: hard to see from transect, far to left, turn before 21. 333 next to 179 3/9: egg small" +2023,hidden,179,greg,2023-03-23,,1,nestling,"3/2: hard to see from transect, far to left, turn before 21. 333 next to 179 3/9: egg small" +2023,hidden,179,greg,2023-03-29,,1,nestling,"3/2: hard to see from transect, far to left, turn before 21. 333 next to 179 3/9: egg small" +2023,hidden,179,greg,2023-04-06,,1,nestling,"3/2: hard to see from transect, far to left, turn before 21. 333 next to 179 3/9: egg small" +2023,hidden,179,greg,2023-04-14,,1,nestling,"3/2: hard to see from transect, far to left, turn before 21. 333 next to 179 3/9: egg small" +2023,hidden,179,greg,2023-04-21,,1,branchling,"3/2: hard to see from transect, far to left, turn before 21. 333 next to 179 3/9: egg small" +2023,hidden,179,greg,2023-04-28,,1,branchling,"3/2: hard to see from transect, far to left, turn before 21. 333 next to 179 3/9: egg small" +2023,hidden,179,greg,2023-05-05,,,empty,"3/2: hard to see from transect, far to left, turn before 21. 333 next to 179 3/9: egg small" +2023,hidden,133,rosp,2023-02-16,,,,"3/2: next to 179" +2023,hidden,133,rosp,2023-02-23,3,,incubating,"3/2: next to 179" +2023,hidden,133,rosp,2023-03-02,4,,incubating,"3/2: next to 179" +2023,hidden,133,rosp,2023-03-09,4,,incubating,"3/2: next to 179" +2023,hidden,133,rosp,2023-03-16,4,,incubating,"3/2: next to 179" +2023,hidden,133,rosp,2023-03-23,3,,incubating,"3/2: next to 179" +2023,hidden,133,rosp,2023-03-29,3,,incubating,"3/2: next to 179" +2023,hidden,133,rosp,2023-04-06,,,empty,"3/2: next to 179" +2023,hidden,133,rosp,2023-04-14,,,missed,"3/2: next to 179" +2023,hidden,133,rosp,2023-04-21,,,empty,"3/2: next to 179" +2023,hidden,133,rosp,2023-04-28,,,pulled,"3/2: next to 179" +2023,hidden,133,rosp,2023-05-05,,,,"3/2: next to 179" +2023,hidden,72,greg,2023-02-16,3,,incubating, +2023,hidden,72,greg,2023-02-23,3,,incubating, +2023,hidden,72,greg,2023-03-02,3,,incubating, +2023,hidden,72,greg,2023-03-09,3,,incubating, +2023,hidden,72,greg,2023-03-16,,3,nestling, +2023,hidden,72,greg,2023-03-23,,2,nestling, +2023,hidden,72,greg,2023-03-29,,1,nestling, +2023,hidden,72,greg,2023-04-06,,1,nestling, +2023,hidden,72,greg,2023-04-14,,1,nestling, +2023,hidden,72,greg,2023-04-21,,1,branchling, +2023,hidden,72,greg,2023-04-28,,1,branchling, +2023,hidden,72,greg,2023-05-05,,,empty, +2023,hidden,41,greg,2023-02-16,3,,incubating,"3/2: no GREG eggs, replaced w/ ROSP eggs" +2023,hidden,41,greg,2023-02-23,3,,incubating,"3/2: no GREG eggs, replaced w/ ROSP eggs" +2023,hidden,41,greg,2023-03-02,,,empty,"3/2: no GREG eggs, replaced w/ ROSP eggs" +2023,hidden,41,greg,2023-03-09,,,,"3/2: no GREG eggs, replaced w/ ROSP eggs" +2023,hidden,41,greg,2023-03-16,,,,"3/2: no GREG eggs, replaced w/ ROSP eggs" +2023,hidden,41,greg,2023-03-23,,,,"3/2: no GREG eggs, replaced w/ ROSP eggs" +2023,hidden,41,greg,2023-03-29,,,,"3/2: no GREG eggs, replaced w/ ROSP eggs" +2023,hidden,41,greg,2023-04-06,,,,"3/2: no GREG eggs, replaced w/ ROSP eggs" +2023,hidden,41,greg,2023-04-14,,,,"3/2: no GREG eggs, replaced w/ ROSP eggs" +2023,hidden,41,greg,2023-04-21,,,,"3/2: no GREG eggs, replaced w/ ROSP eggs" +2023,hidden,41,greg,2023-04-28,,,,"3/2: no GREG eggs, replaced w/ ROSP eggs" +2023,hidden,41,greg,2023-05-05,,,,"3/2: no GREG eggs, replaced w/ ROSP eggs" +2023,hidden,*41,rosp,2023-02-16,,,,"3/2 former GREG nest, now replaced with ROSP, 3/9: pulled flag, nest gone, rosp eggshell below" +2023,hidden,*41,rosp,2023-02-23,,,,"3/2 former GREG nest, now replaced with ROSP, 3/9: pulled flag, nest gone, rosp eggshell below" +2023,hidden,*41,rosp,2023-03-02,1,,incubating,"3/2 former GREG nest, now replaced with ROSP, 3/9: pulled flag, nest gone, rosp eggshell below" +2023,hidden,*41,rosp,2023-03-09,,,empty,"3/2 former GREG nest, now replaced with ROSP, 3/9: pulled flag, nest gone, rosp eggshell below" +2023,hidden,*41,rosp,2023-03-16,,,,"3/2 former GREG nest, now replaced with ROSP, 3/9: pulled flag, nest gone, rosp eggshell below" +2023,hidden,*41,rosp,2023-03-23,,,,"3/2 former GREG nest, now replaced with ROSP, 3/9: pulled flag, nest gone, rosp eggshell below" +2023,hidden,*41,rosp,2023-03-29,,,,"3/2 former GREG nest, now replaced with ROSP, 3/9: pulled flag, nest gone, rosp eggshell below" +2023,hidden,*41,rosp,2023-04-06,,,,"3/2 former GREG nest, now replaced with ROSP, 3/9: pulled flag, nest gone, rosp eggshell below" +2023,hidden,*41,rosp,2023-04-14,,,,"3/2 former GREG nest, now replaced with ROSP, 3/9: pulled flag, nest gone, rosp eggshell below" +2023,hidden,*41,rosp,2023-04-21,,,,"3/2 former GREG nest, now replaced with ROSP, 3/9: pulled flag, nest gone, rosp eggshell below" +2023,hidden,*41,rosp,2023-04-28,,,,"3/2 former GREG nest, now replaced with ROSP, 3/9: pulled flag, nest gone, rosp eggshell below" +2023,hidden,*41,rosp,2023-05-05,,,,"3/2 former GREG nest, now replaced with ROSP, 3/9: pulled flag, nest gone, rosp eggshell below" +2023,hidden,135,greg,2023-02-16,,,,"3/23: dead chick in nest 4/6: chick could have run 4/21: dead chick" +2023,hidden,135,greg,2023-02-23,3,,incubating,"3/23: dead chick in nest 4/6: chick could have run 4/21: dead chick" +2023,hidden,135,greg,2023-03-02,3,,incubating,"3/23: dead chick in nest 4/6: chick could have run 4/21: dead chick" +2023,hidden,135,greg,2023-03-09,3,,incubating,"3/23: dead chick in nest 4/6: chick could have run 4/21: dead chick" +2023,hidden,135,greg,2023-03-16,,3,nestling,"3/23: dead chick in nest 4/6: chick could have run 4/21: dead chick" +2023,hidden,135,greg,2023-03-23,,2,nestling,"3/23: dead chick in nest 4/6: chick could have run 4/21: dead chick" +2023,hidden,135,greg,2023-03-29,,2,nestling,"3/23: dead chick in nest 4/6: chick could have run 4/21: dead chick" +2023,hidden,135,greg,2023-04-06,,1,nestling,"3/23: dead chick in nest 4/6: chick could have run 4/21: dead chick" +2023,hidden,135,greg,2023-04-14,,1,nestling,"3/23: dead chick in nest 4/6: chick could have run 4/21: dead chick" +2023,hidden,135,greg,2023-04-21,,,empty,"3/23: dead chick in nest 4/6: chick could have run 4/21: dead chick" +2023,hidden,135,greg,2023-04-28,,,pulled,"3/23: dead chick in nest 4/6: chick could have run 4/21: dead chick" +2023,hidden,135,greg,2023-05-05,,,,"3/23: dead chick in nest 4/6: chick could have run 4/21: dead chick" +2023,hidden,130,bcnh,2023-02-16,,,,"3/29: one big chick up high in canopy 4/6: pulled flag" +2023,hidden,130,bcnh,2023-02-23,3,,incubating,"3/29: one big chick up high in canopy 4/6: pulled flag" +2023,hidden,130,bcnh,2023-03-02,,3,nestling,"3/29: one big chick up high in canopy 4/6: pulled flag" +2023,hidden,130,bcnh,2023-03-09,,3,nestling,"3/29: one big chick up high in canopy 4/6: pulled flag" +2023,hidden,130,bcnh,2023-03-16,,2,nestling,"3/29: one big chick up high in canopy 4/6: pulled flag" +2023,hidden,130,bcnh,2023-03-23,,1,nestling,"3/29: one big chick up high in canopy 4/6: pulled flag" +2023,hidden,130,bcnh,2023-03-29,,,empty,"3/29: one big chick up high in canopy 4/6: pulled flag" +2023,hidden,130,bcnh,2023-04-06,,,pulled,"3/29: one big chick up high in canopy 4/6: pulled flag" +2023,hidden,130,bcnh,2023-04-14,,,,"3/29: one big chick up high in canopy 4/6: pulled flag" +2023,hidden,130,bcnh,2023-04-21,,,,"3/29: one big chick up high in canopy 4/6: pulled flag" +2023,hidden,130,bcnh,2023-04-28,,,,"3/29: one big chick up high in canopy 4/6: pulled flag" +2023,hidden,130,bcnh,2023-05-05,,,,"3/29: one big chick up high in canopy 4/6: pulled flag" +2023,hidden,181,bcnh,2023-02-16,,,,"2/23: one broken egg; 3/29: very small eggs, smhe takeover? 4/14: 1 GREG chick in nest (some confusion in this area)" +2023,hidden,181,bcnh,2023-02-23,3,,incubating,"2/23: one broken egg; 3/29: very small eggs, smhe takeover? 4/14: 1 GREG chick in nest (some confusion in this area)" +2023,hidden,181,bcnh,2023-03-02,,,empty,"2/23: one broken egg; 3/29: very small eggs, smhe takeover? 4/14: 1 GREG chick in nest (some confusion in this area)" +2023,hidden,181,bcnh,2023-03-09,2,,incubating,"2/23: one broken egg; 3/29: very small eggs, smhe takeover? 4/14: 1 GREG chick in nest (some confusion in this area)" +2023,hidden,181,bcnh,2023-03-16,4,,incubating,"2/23: one broken egg; 3/29: very small eggs, smhe takeover? 4/14: 1 GREG chick in nest (some confusion in this area)" +2023,hidden,181,bcnh,2023-03-23,4,,incubating,"2/23: one broken egg; 3/29: very small eggs, smhe takeover? 4/14: 1 GREG chick in nest (some confusion in this area)" +2023,hidden,181,bcnh,2023-03-29,4,,incubating,"2/23: one broken egg; 3/29: very small eggs, smhe takeover? 4/14: 1 GREG chick in nest (some confusion in this area)" +2023,hidden,181,bcnh,2023-04-06,,3,nestling,"2/23: one broken egg; 3/29: very small eggs, smhe takeover? 4/14: 1 GREG chick in nest (some confusion in this area)" +2023,hidden,181,bcnh,2023-04-14,,,empty,"2/23: one broken egg; 3/29: very small eggs, smhe takeover? 4/14: 1 GREG chick in nest (some confusion in this area)" +2023,hidden,181,bcnh,2023-04-21,,,pulled,"2/23: one broken egg; 3/29: very small eggs, smhe takeover? 4/14: 1 GREG chick in nest (some confusion in this area)" +2023,hidden,181,bcnh,2023-04-28,,,,"2/23: one broken egg; 3/29: very small eggs, smhe takeover? 4/14: 1 GREG chick in nest (some confusion in this area)" +2023,hidden,181,bcnh,2023-05-05,,,,"2/23: one broken egg; 3/29: very small eggs, smhe takeover? 4/14: 1 GREG chick in nest (some confusion in this area)" +2023,hidden,*181,smwh,2023-02-16,,,,"2/23: one broken egg; 3/29: very small eggs, smhe takeover? 4/14: 1 GREG chick in nest (some confusion in this area)" +2023,hidden,*181,smwh,2023-02-23,3,,incubating,"2/23: one broken egg; 3/29: very small eggs, smhe takeover? 4/14: 1 GREG chick in nest (some confusion in this area)" +2023,hidden,*181,smwh,2023-03-02,,,empty,"2/23: one broken egg; 3/29: very small eggs, smhe takeover? 4/14: 1 GREG chick in nest (some confusion in this area)" +2023,hidden,*181,smwh,2023-03-09,2,,incubating,"2/23: one broken egg; 3/29: very small eggs, smhe takeover? 4/14: 1 GREG chick in nest (some confusion in this area)" +2023,hidden,*181,smwh,2023-03-16,4,,incubating,"2/23: one broken egg; 3/29: very small eggs, smhe takeover? 4/14: 1 GREG chick in nest (some confusion in this area)" +2023,hidden,*181,smwh,2023-03-23,4,,incubating,"2/23: one broken egg; 3/29: very small eggs, smhe takeover? 4/14: 1 GREG chick in nest (some confusion in this area)" +2023,hidden,*181,smwh,2023-03-29,4,,incubating,"2/23: one broken egg; 3/29: very small eggs, smhe takeover? 4/14: 1 GREG chick in nest (some confusion in this area)" +2023,hidden,*181,smwh,2023-04-06,,3,nestling,"2/23: one broken egg; 3/29: very small eggs, smhe takeover? 4/14: 1 GREG chick in nest (some confusion in this area)" +2023,hidden,*181,smwh,2023-04-14,,,empty,"2/23: one broken egg; 3/29: very small eggs, smhe takeover? 4/14: 1 GREG chick in nest (some confusion in this area)" +2023,hidden,*181,smwh,2023-04-21,,,pulled,"2/23: one broken egg; 3/29: very small eggs, smhe takeover? 4/14: 1 GREG chick in nest (some confusion in this area)" +2023,hidden,*181,smwh,2023-04-28,,,,"2/23: one broken egg; 3/29: very small eggs, smhe takeover? 4/14: 1 GREG chick in nest (some confusion in this area)" +2023,hidden,*181,smwh,2023-05-05,,,,"2/23: one broken egg; 3/29: very small eggs, smhe takeover? 4/14: 1 GREG chick in nest (some confusion in this area)" +2023,hidden,74,greg,2023-02-16,2,,incubating,"2/23: one egg pipping 3/23: one chick lively, the other with dying head tuck 4/14: chick high above nest 4/21: pulled flag" +2023,hidden,74,greg,2023-02-23,2,,pipping,"2/23: one egg pipping 3/23: one chick lively, the other with dying head tuck 4/14: chick high above nest 4/21: pulled flag" +2023,hidden,74,greg,2023-03-02,,2,nestling,"2/23: one egg pipping 3/23: one chick lively, the other with dying head tuck 4/14: chick high above nest 4/21: pulled flag" +2023,hidden,74,greg,2023-03-09,,2,nestling,"2/23: one egg pipping 3/23: one chick lively, the other with dying head tuck 4/14: chick high above nest 4/21: pulled flag" +2023,hidden,74,greg,2023-03-16,,2,nestling,"2/23: one egg pipping 3/23: one chick lively, the other with dying head tuck 4/14: chick high above nest 4/21: pulled flag" +2023,hidden,74,greg,2023-03-23,,2,nestling,"2/23: one egg pipping 3/23: one chick lively, the other with dying head tuck 4/14: chick high above nest 4/21: pulled flag" +2023,hidden,74,greg,2023-03-29,,,missed,"2/23: one egg pipping 3/23: one chick lively, the other with dying head tuck 4/14: chick high above nest 4/21: pulled flag" +2023,hidden,74,greg,2023-04-06,,,empty,"2/23: one egg pipping 3/23: one chick lively, the other with dying head tuck 4/14: chick high above nest 4/21: pulled flag" +2023,hidden,74,greg,2023-04-14,,1,nestling,"2/23: one egg pipping 3/23: one chick lively, the other with dying head tuck 4/14: chick high above nest 4/21: pulled flag" +2023,hidden,74,greg,2023-04-21,,,empty,"2/23: one egg pipping 3/23: one chick lively, the other with dying head tuck 4/14: chick high above nest 4/21: pulled flag" +2023,hidden,74,greg,2023-04-28,,,,"2/23: one egg pipping 3/23: one chick lively, the other with dying head tuck 4/14: chick high above nest 4/21: pulled flag" +2023,hidden,74,greg,2023-05-05,,,,"2/23: one egg pipping 3/23: one chick lively, the other with dying head tuck 4/14: chick high above nest 4/21: pulled flag" +2023,hidden,76,greg,2023-02-16,2,,incubating,"3/23: 2 dead chicks in nest, changed species to GREG from BCNH; 3/29: flag pulled" +2023,hidden,76,greg,2023-02-23,2,,incubating,"3/23: 2 dead chicks in nest, changed species to GREG from BCNH; 3/29: flag pulled" +2023,hidden,76,greg,2023-03-02,2,,incubating,"3/23: 2 dead chicks in nest, changed species to GREG from BCNH; 3/29: flag pulled" +2023,hidden,76,greg,2023-03-09,,2,nestling,"3/23: 2 dead chicks in nest, changed species to GREG from BCNH; 3/29: flag pulled" +2023,hidden,76,greg,2023-03-16,,2,nestling,"3/23: 2 dead chicks in nest, changed species to GREG from BCNH; 3/29: flag pulled" +2023,hidden,76,greg,2023-03-23,,,empty,"3/23: 2 dead chicks in nest, changed species to GREG from BCNH; 3/29: flag pulled" +2023,hidden,76,greg,2023-03-29,,,pulled,"3/23: 2 dead chicks in nest, changed species to GREG from BCNH; 3/29: flag pulled" +2023,hidden,76,greg,2023-04-06,,,,"3/23: 2 dead chicks in nest, changed species to GREG from BCNH; 3/29: flag pulled" +2023,hidden,76,greg,2023-04-14,,,,"3/23: 2 dead chicks in nest, changed species to GREG from BCNH; 3/29: flag pulled" +2023,hidden,76,greg,2023-04-21,,,,"3/23: 2 dead chicks in nest, changed species to GREG from BCNH; 3/29: flag pulled" +2023,hidden,76,greg,2023-04-28,,,,"3/23: 2 dead chicks in nest, changed species to GREG from BCNH; 3/29: flag pulled" +2023,hidden,76,greg,2023-05-05,,,,"3/23: 2 dead chicks in nest, changed species to GREG from BCNH; 3/29: flag pulled" +2023,hidden,84,greg,2023-02-16,2,,incubating,"3/23: nest gone, flag not pulled 3/29: nest still gone" +2023,hidden,84,greg,2023-02-23,2,,incubating,"3/23: nest gone, flag not pulled 3/29: nest still gone" +2023,hidden,84,greg,2023-03-02,2,,incubating,"3/23: nest gone, flag not pulled 3/29: nest still gone" +2023,hidden,84,greg,2023-03-09,,2,nestling,"3/23: nest gone, flag not pulled 3/29: nest still gone" +2023,hidden,84,greg,2023-03-16,,,empty,"3/23: nest gone, flag not pulled 3/29: nest still gone" +2023,hidden,84,greg,2023-03-23,,,empty,"3/23: nest gone, flag not pulled 3/29: nest still gone" +2023,hidden,84,greg,2023-03-29,,,pulled,"3/23: nest gone, flag not pulled 3/29: nest still gone" +2023,hidden,84,greg,2023-04-06,,,,"3/23: nest gone, flag not pulled 3/29: nest still gone" +2023,hidden,84,greg,2023-04-14,,,,"3/23: nest gone, flag not pulled 3/29: nest still gone" +2023,hidden,84,greg,2023-04-21,,,,"3/23: nest gone, flag not pulled 3/29: nest still gone" +2023,hidden,84,greg,2023-04-28,,,,"3/23: nest gone, flag not pulled 3/29: nest still gone" +2023,hidden,84,greg,2023-05-05,,,,"3/23: nest gone, flag not pulled 3/29: nest still gone" +2023,hidden,132,greg,2023-02-16,,,,"3/9: egg pipping and chick wet 4/21: chick dying; 4/28: chick above nest. 1 chick between 132 & 136" +2023,hidden,132,greg,2023-02-23,2,,incubating,"3/9: egg pipping and chick wet 4/21: chick dying; 4/28: chick above nest. 1 chick between 132 & 136" +2023,hidden,132,greg,2023-03-02,2,,incubating,"3/9: egg pipping and chick wet 4/21: chick dying; 4/28: chick above nest. 1 chick between 132 & 136" +2023,hidden,132,greg,2023-03-09,1,1,wet_chick,"3/9: egg pipping and chick wet 4/21: chick dying; 4/28: chick above nest. 1 chick between 132 & 136" +2023,hidden,132,greg,2023-03-16,,,missed,"3/9: egg pipping and chick wet 4/21: chick dying; 4/28: chick above nest. 1 chick between 132 & 136" +2023,hidden,132,greg,2023-03-23,,2,nestling,"3/9: egg pipping and chick wet 4/21: chick dying; 4/28: chick above nest. 1 chick between 132 & 136" +2023,hidden,132,greg,2023-03-29,,2,nestling,"3/9: egg pipping and chick wet 4/21: chick dying; 4/28: chick above nest. 1 chick between 132 & 136" +2023,hidden,132,greg,2023-04-06,,2,nestling,"3/9: egg pipping and chick wet 4/21: chick dying; 4/28: chick above nest. 1 chick between 132 & 136" +2023,hidden,132,greg,2023-04-14,,2,nestling,"3/9: egg pipping and chick wet 4/21: chick dying; 4/28: chick above nest. 1 chick between 132 & 136" +2023,hidden,132,greg,2023-04-21,,1,nestling,"3/9: egg pipping and chick wet 4/21: chick dying; 4/28: chick above nest. 1 chick between 132 & 136" +2023,hidden,132,greg,2023-04-28,,1,nestling,"3/9: egg pipping and chick wet 4/21: chick dying; 4/28: chick above nest. 1 chick between 132 & 136" +2023,hidden,132,greg,2023-05-05,,,,"3/9: egg pipping and chick wet 4/21: chick dying; 4/28: chick above nest. 1 chick between 132 & 136" +2023,hidden,134,bcnh,2023-02-16,,,, +2023,hidden,134,bcnh,2023-02-23,2,,incubating, +2023,hidden,134,bcnh,2023-03-02,,2,nestling, +2023,hidden,134,bcnh,2023-03-09,,2,nestling, +2023,hidden,134,bcnh,2023-03-16,,2,nestling, +2023,hidden,134,bcnh,2023-03-23,,1,nestling, +2023,hidden,134,bcnh,2023-03-29,,,missed, +2023,hidden,134,bcnh,2023-04-06,,,missed, +2023,hidden,134,bcnh,2023-04-14,,,empty, +2023,hidden,134,bcnh,2023-04-21,,,, +2023,hidden,134,bcnh,2023-04-28,,,, +2023,hidden,134,bcnh,2023-05-05,,,, +2023,hidden,*134,smhe,2023-02-16,,,,"4/14: smhe takeover? 4/21: pulled flag" +2023,hidden,*134,smhe,2023-02-23,,,,"4/14: smhe takeover? 4/21: pulled flag" +2023,hidden,*134,smhe,2023-03-02,,,,"4/14: smhe takeover? 4/21: pulled flag" +2023,hidden,*134,smhe,2023-03-09,,,,"4/14: smhe takeover? 4/21: pulled flag" +2023,hidden,*134,smhe,2023-03-16,,,,"4/14: smhe takeover? 4/21: pulled flag" +2023,hidden,*134,smhe,2023-03-23,,,,"4/14: smhe takeover? 4/21: pulled flag" +2023,hidden,*134,smhe,2023-03-29,,,,"4/14: smhe takeover? 4/21: pulled flag" +2023,hidden,*134,smhe,2023-04-06,,,,"4/14: smhe takeover? 4/21: pulled flag" +2023,hidden,*134,smhe,2023-04-14,3,,incubating,"4/14: smhe takeover? 4/21: pulled flag" +2023,hidden,*134,smhe,2023-04-21,,,empty,"4/14: smhe takeover? 4/21: pulled flag" +2023,hidden,*134,smhe,2023-04-28,,,,"4/14: smhe takeover? 4/21: pulled flag" +2023,hidden,*134,smhe,2023-05-05,,,,"4/14: smhe takeover? 4/21: pulled flag" +2023,hidden,183,greg,2023-02-16,,,, +2023,hidden,183,greg,2023-02-23,2,,incubating, +2023,hidden,183,greg,2023-03-02,,2,nestling, +2023,hidden,183,greg,2023-03-09,,2,nestling, +2023,hidden,183,greg,2023-03-16,,2,nestling, +2023,hidden,183,greg,2023-03-23,,1,nestling, +2023,hidden,183,greg,2023-03-29,,1,nestling, +2023,hidden,183,greg,2023-04-06,,,empty, +2023,hidden,183,greg,2023-04-14,,,missed, +2023,hidden,183,greg,2023-04-21,,,empty, +2023,hidden,183,greg,2023-04-28,,,missed, +2023,hidden,183,greg,2023-05-05,,,, +2023,hidden,136,greg,2023-02-16,,,,"4/28: 1 chick between 132 & 136" +2023,hidden,136,greg,2023-02-23,2,,incubating,"4/28: 1 chick between 132 & 136" +2023,hidden,136,greg,2023-03-02,2,,incubating,"4/28: 1 chick between 132 & 136" +2023,hidden,136,greg,2023-03-09,,2,nestling,"4/28: 1 chick between 132 & 136" +2023,hidden,136,greg,2023-03-16,,2,nestling,"4/28: 1 chick between 132 & 136" +2023,hidden,136,greg,2023-03-23,,2,nestling,"4/28: 1 chick between 132 & 136" +2023,hidden,136,greg,2023-03-29,,2,nestling,"4/28: 1 chick between 132 & 136" +2023,hidden,136,greg,2023-04-06,,1,nestling,"4/28: 1 chick between 132 & 136" +2023,hidden,136,greg,2023-04-14,,1,nestling,"4/28: 1 chick between 132 & 136" +2023,hidden,136,greg,2023-04-21,,,missed,"4/28: 1 chick between 132 & 136" +2023,hidden,136,greg,2023-04-28,,,empty,"4/28: 1 chick between 132 & 136" +2023,hidden,136,greg,2023-05-05,,,,"4/28: 1 chick between 132 & 136" +2023,hidden,43,greg,2023-02-16,3,,incubating,"2/23: eggshell on ground; 3/2: pulled flag" +2023,hidden,43,greg,2023-02-23,,,empty,"2/23: eggshell on ground; 3/2: pulled flag" +2023,hidden,43,greg,2023-03-02,,,pulled,"2/23: eggshell on ground; 3/2: pulled flag" +2023,hidden,43,greg,2023-03-09,,,,"2/23: eggshell on ground; 3/2: pulled flag" +2023,hidden,43,greg,2023-03-16,,,,"2/23: eggshell on ground; 3/2: pulled flag" +2023,hidden,43,greg,2023-03-23,,,,"2/23: eggshell on ground; 3/2: pulled flag" +2023,hidden,43,greg,2023-03-29,,,,"2/23: eggshell on ground; 3/2: pulled flag" +2023,hidden,43,greg,2023-04-06,,,,"2/23: eggshell on ground; 3/2: pulled flag" +2023,hidden,43,greg,2023-04-14,,,,"2/23: eggshell on ground; 3/2: pulled flag" +2023,hidden,43,greg,2023-04-21,,,,"2/23: eggshell on ground; 3/2: pulled flag" +2023,hidden,43,greg,2023-04-28,,,,"2/23: eggshell on ground; 3/2: pulled flag" +2023,hidden,43,greg,2023-05-05,,,,"2/23: eggshell on ground; 3/2: pulled flag" +2023,hidden,197,greg,2023-02-16,,,,"3/29: small chick 4/14: 1 big chick nearby, but could be from anywhere" +2023,hidden,197,greg,2023-02-23,2,,incubating,"3/29: small chick 4/14: 1 big chick nearby, but could be from anywhere" +2023,hidden,197,greg,2023-03-02,2,,incubating,"3/29: small chick 4/14: 1 big chick nearby, but could be from anywhere" +2023,hidden,197,greg,2023-03-09,2,,incubating,"3/29: small chick 4/14: 1 big chick nearby, but could be from anywhere" +2023,hidden,197,greg,2023-03-16,2,,incubating,"3/29: small chick 4/14: 1 big chick nearby, but could be from anywhere" +2023,hidden,197,greg,2023-03-23,,2,nestling,"3/29: small chick 4/14: 1 big chick nearby, but could be from anywhere" +2023,hidden,197,greg,2023-03-29,,1,nestling,"3/29: small chick 4/14: 1 big chick nearby, but could be from anywhere" +2023,hidden,197,greg,2023-04-06,,,empty,"3/29: small chick 4/14: 1 big chick nearby, but could be from anywhere" +2023,hidden,197,greg,2023-04-14,,,empty,"3/29: small chick 4/14: 1 big chick nearby, but could be from anywhere" +2023,hidden,197,greg,2023-04-21,,,pulled,"3/29: small chick 4/14: 1 big chick nearby, but could be from anywhere" +2023,hidden,197,greg,2023-04-28,,,,"3/29: small chick 4/14: 1 big chick nearby, but could be from anywhere" +2023,hidden,197,greg,2023-05-05,,,,"3/29: small chick 4/14: 1 big chick nearby, but could be from anywhere" +2023,hidden,138,greg,2023-02-16,,,,"3/16: can only confirm 2 chicks 4/6: big chick, sampled for mercury; 4/21: large chick above" +2023,hidden,138,greg,2023-02-23,3,,pipping,"3/16: can only confirm 2 chicks 4/6: big chick, sampled for mercury; 4/21: large chick above" +2023,hidden,138,greg,2023-03-02,,3,nestling,"3/16: can only confirm 2 chicks 4/6: big chick, sampled for mercury; 4/21: large chick above" +2023,hidden,138,greg,2023-03-09,,3,nestling,"3/16: can only confirm 2 chicks 4/6: big chick, sampled for mercury; 4/21: large chick above" +2023,hidden,138,greg,2023-03-16,,2,nestling,"3/16: can only confirm 2 chicks 4/6: big chick, sampled for mercury; 4/21: large chick above" +2023,hidden,138,greg,2023-03-23,,2,nestling,"3/16: can only confirm 2 chicks 4/6: big chick, sampled for mercury; 4/21: large chick above" +2023,hidden,138,greg,2023-03-29,,,missed,"3/16: can only confirm 2 chicks 4/6: big chick, sampled for mercury; 4/21: large chick above" +2023,hidden,138,greg,2023-04-06,,1,nestling,"3/16: can only confirm 2 chicks 4/6: big chick, sampled for mercury; 4/21: large chick above" +2023,hidden,138,greg,2023-04-14,,,empty,"3/16: can only confirm 2 chicks 4/6: big chick, sampled for mercury; 4/21: large chick above" +2023,hidden,138,greg,2023-04-21,,,pulled,"3/16: can only confirm 2 chicks 4/6: big chick, sampled for mercury; 4/21: large chick above" +2023,hidden,138,greg,2023-04-28,,,,"3/16: can only confirm 2 chicks 4/6: big chick, sampled for mercury; 4/21: large chick above" +2023,hidden,138,greg,2023-05-05,,,,"3/16: can only confirm 2 chicks 4/6: big chick, sampled for mercury; 4/21: large chick above" +2023,hidden,140,greg,2023-02-16,,,,"4/21: one egg in nest (probably dead), and one large dead greg chick in nest." +2023,hidden,140,greg,2023-02-23,3,,incubating,"4/21: one egg in nest (probably dead), and one large dead greg chick in nest." +2023,hidden,140,greg,2023-03-02,3,,incubating,"4/21: one egg in nest (probably dead), and one large dead greg chick in nest." +2023,hidden,140,greg,2023-03-09,,3,nestling,"4/21: one egg in nest (probably dead), and one large dead greg chick in nest." +2023,hidden,140,greg,2023-03-16,,3,nestling,"4/21: one egg in nest (probably dead), and one large dead greg chick in nest." +2023,hidden,140,greg,2023-03-23,,3,nestling,"4/21: one egg in nest (probably dead), and one large dead greg chick in nest." +2023,hidden,140,greg,2023-03-29,,2,nestling,"4/21: one egg in nest (probably dead), and one large dead greg chick in nest." +2023,hidden,140,greg,2023-04-06,,2,nestling,"4/21: one egg in nest (probably dead), and one large dead greg chick in nest." +2023,hidden,140,greg,2023-04-14,,,missed,"4/21: one egg in nest (probably dead), and one large dead greg chick in nest." +2023,hidden,140,greg,2023-04-21,1,,empty,"4/21: one egg in nest (probably dead), and one large dead greg chick in nest." +2023,hidden,140,greg,2023-04-28,,,pulled,"4/21: one egg in nest (probably dead), and one large dead greg chick in nest." +2023,hidden,140,greg,2023-05-05,,,,"4/21: one egg in nest (probably dead), and one large dead greg chick in nest." +2023,hidden,86,greg,2023-02-16,2,,incubating,"3/29: 2 dead chicks, flag pulled" +2023,hidden,86,greg,2023-02-23,2,,incubating,"3/29: 2 dead chicks, flag pulled" +2023,hidden,86,greg,2023-03-02,1,1,wet_chick,"3/29: 2 dead chicks, flag pulled" +2023,hidden,86,greg,2023-03-09,,2,nestling,"3/29: 2 dead chicks, flag pulled" +2023,hidden,86,greg,2023-03-16,,2,nestling,"3/29: 2 dead chicks, flag pulled" +2023,hidden,86,greg,2023-03-23,,2,nestling,"3/29: 2 dead chicks, flag pulled" +2023,hidden,86,greg,2023-03-29,,,empty,"3/29: 2 dead chicks, flag pulled" +2023,hidden,86,greg,2023-04-06,,,,"3/29: 2 dead chicks, flag pulled" +2023,hidden,86,greg,2023-04-14,,,,"3/29: 2 dead chicks, flag pulled" +2023,hidden,86,greg,2023-04-21,,,,"3/29: 2 dead chicks, flag pulled" +2023,hidden,86,greg,2023-04-28,,,,"3/29: 2 dead chicks, flag pulled" +2023,hidden,86,greg,2023-05-05,,,,"3/29: 2 dead chicks, flag pulled" +2023,hidden,88,greg,2023-02-16,2,,incubating,"3/2: one egg pipping and one chick dry 4/6: sampled one chick for mercury 4/14: 1 big chick in area, but also could have come from 324; 5/5: One live chick and one dead between 88 and 324" +2023,hidden,88,greg,2023-02-23,2,,incubating,"3/2: one egg pipping and one chick dry 4/6: sampled one chick for mercury 4/14: 1 big chick in area, but also could have come from 324; 5/5: One live chick and one dead between 88 and 324" +2023,hidden,88,greg,2023-03-02,1,1,chick_dry,"3/2: one egg pipping and one chick dry 4/6: sampled one chick for mercury 4/14: 1 big chick in area, but also could have come from 324; 5/5: One live chick and one dead between 88 and 324" +2023,hidden,88,greg,2023-03-09,,2,nestling,"3/2: one egg pipping and one chick dry 4/6: sampled one chick for mercury 4/14: 1 big chick in area, but also could have come from 324; 5/5: One live chick and one dead between 88 and 324" +2023,hidden,88,greg,2023-03-16,,2,nestling,"3/2: one egg pipping and one chick dry 4/6: sampled one chick for mercury 4/14: 1 big chick in area, but also could have come from 324; 5/5: One live chick and one dead between 88 and 324" +2023,hidden,88,greg,2023-03-23,,2,nestling,"3/2: one egg pipping and one chick dry 4/6: sampled one chick for mercury 4/14: 1 big chick in area, but also could have come from 324; 5/5: One live chick and one dead between 88 and 324" +2023,hidden,88,greg,2023-03-29,,2,nestling,"3/2: one egg pipping and one chick dry 4/6: sampled one chick for mercury 4/14: 1 big chick in area, but also could have come from 324; 5/5: One live chick and one dead between 88 and 324" +2023,hidden,88,greg,2023-04-06,,2,nestling,"3/2: one egg pipping and one chick dry 4/6: sampled one chick for mercury 4/14: 1 big chick in area, but also could have come from 324; 5/5: One live chick and one dead between 88 and 324" +2023,hidden,88,greg,2023-04-14,,,empty,"3/2: one egg pipping and one chick dry 4/6: sampled one chick for mercury 4/14: 1 big chick in area, but also could have come from 324; 5/5: One live chick and one dead between 88 and 324" +2023,hidden,88,greg,2023-04-21,,,empty,"3/2: one egg pipping and one chick dry 4/6: sampled one chick for mercury 4/14: 1 big chick in area, but also could have come from 324; 5/5: One live chick and one dead between 88 and 324" +2023,hidden,88,greg,2023-04-28,,1,branchling,"3/2: one egg pipping and one chick dry 4/6: sampled one chick for mercury 4/14: 1 big chick in area, but also could have come from 324; 5/5: One live chick and one dead between 88 and 324" +2023,hidden,88,greg,2023-05-05,,,empty,"3/2: one egg pipping and one chick dry 4/6: sampled one chick for mercury 4/14: 1 big chick in area, but also could have come from 324; 5/5: One live chick and one dead between 88 and 324" +2023,hidden,142,greg,2023-02-16,,,,"3/29: flag pulled" +2023,hidden,142,greg,2023-02-23,2,,incubating,"3/29: flag pulled" +2023,hidden,142,greg,2023-03-02,2,,incubating,"3/29: flag pulled" +2023,hidden,142,greg,2023-03-09,2,,incubating,"3/29: flag pulled" +2023,hidden,142,greg,2023-03-16,,2,nestling,"3/29: flag pulled" +2023,hidden,142,greg,2023-03-23,,2,nestling,"3/29: flag pulled" +2023,hidden,142,greg,2023-03-29,,,empty,"3/29: flag pulled" +2023,hidden,142,greg,2023-04-06,,,,"3/29: flag pulled" +2023,hidden,142,greg,2023-04-14,,,,"3/29: flag pulled" +2023,hidden,142,greg,2023-04-21,,,,"3/29: flag pulled" +2023,hidden,142,greg,2023-04-28,,,,"3/29: flag pulled" +2023,hidden,142,greg,2023-05-05,,,,"3/29: flag pulled" +2023,hidden,185,greg,2023-02-16,,,,"3/16: certain only 2 chicks 3/23: 2 dead chicks" +2023,hidden,185,greg,2023-02-23,3,,incubating,"3/16: certain only 2 chicks 3/23: 2 dead chicks" +2023,hidden,185,greg,2023-03-02,1,2,chick_dry,"3/16: certain only 2 chicks 3/23: 2 dead chicks" +2023,hidden,185,greg,2023-03-09,,2,nestling,"3/16: certain only 2 chicks 3/23: 2 dead chicks" +2023,hidden,185,greg,2023-03-16,,2,nestling,"3/16: certain only 2 chicks 3/23: 2 dead chicks" +2023,hidden,185,greg,2023-03-23,,,empty,"3/16: certain only 2 chicks 3/23: 2 dead chicks" +2023,hidden,185,greg,2023-03-29,,,,"3/16: certain only 2 chicks 3/23: 2 dead chicks" +2023,hidden,185,greg,2023-04-06,,,,"3/16: certain only 2 chicks 3/23: 2 dead chicks" +2023,hidden,185,greg,2023-04-14,,,,"3/16: certain only 2 chicks 3/23: 2 dead chicks" +2023,hidden,185,greg,2023-04-21,,,,"3/16: certain only 2 chicks 3/23: 2 dead chicks" +2023,hidden,185,greg,2023-04-28,,,,"3/16: certain only 2 chicks 3/23: 2 dead chicks" +2023,hidden,185,greg,2023-05-05,,,,"3/16: certain only 2 chicks 3/23: 2 dead chicks" +2023,hidden,45,greg,2023-02-16,2,,incubating,"4/6: pulled flag" +2023,hidden,45,greg,2023-02-23,2,,incubating,"4/6: pulled flag" +2023,hidden,45,greg,2023-03-02,3,,incubating,"4/6: pulled flag" +2023,hidden,45,greg,2023-03-09,1,1,hatching,"4/6: pulled flag" +2023,hidden,45,greg,2023-03-16,,1,nestling,"4/6: pulled flag" +2023,hidden,45,greg,2023-03-23,,1,nestling,"4/6: pulled flag" +2023,hidden,45,greg,2023-03-29,,,empty,"4/6: pulled flag" +2023,hidden,45,greg,2023-04-06,,,pulled,"4/6: pulled flag" +2023,hidden,45,greg,2023-04-14,,,,"4/6: pulled flag" +2023,hidden,45,greg,2023-04-21,,,,"4/6: pulled flag" +2023,hidden,45,greg,2023-04-28,,,,"4/6: pulled flag" +2023,hidden,45,greg,2023-05-05,,,,"4/6: pulled flag" +2023,hidden,187,greg,2023-02-16,,,,"3/16: pulled flag" +2023,hidden,187,greg,2023-02-23,2,,incubating,"3/16: pulled flag" +2023,hidden,187,greg,2023-03-02,,,empty,"3/16: pulled flag" +2023,hidden,187,greg,2023-03-09,,,empty,"3/16: pulled flag" +2023,hidden,187,greg,2023-03-16,,,pulled,"3/16: pulled flag" +2023,hidden,187,greg,2023-03-23,,,,"3/16: pulled flag" +2023,hidden,187,greg,2023-03-29,,,,"3/16: pulled flag" +2023,hidden,187,greg,2023-04-06,,,,"3/16: pulled flag" +2023,hidden,187,greg,2023-04-14,,,,"3/16: pulled flag" +2023,hidden,187,greg,2023-04-21,,,,"3/16: pulled flag" +2023,hidden,187,greg,2023-04-28,,,,"3/16: pulled flag" +2023,hidden,187,greg,2023-05-05,,,,"3/16: pulled flag" +2023,hidden,144,bcnh,2023-02-16,,,,"2/23: nest far back 3/16: certain only 1 chick; 3/23: chick big 3/29: flag pulled" +2023,hidden,144,bcnh,2023-02-23,3,,incubating,"2/23: nest far back 3/16: certain only 1 chick; 3/23: chick big 3/29: flag pulled" +2023,hidden,144,bcnh,2023-03-02,,3,nestling,"2/23: nest far back 3/16: certain only 1 chick; 3/23: chick big 3/29: flag pulled" +2023,hidden,144,bcnh,2023-03-09,,2,nestling,"2/23: nest far back 3/16: certain only 1 chick; 3/23: chick big 3/29: flag pulled" +2023,hidden,144,bcnh,2023-03-16,,1,nestling,"2/23: nest far back 3/16: certain only 1 chick; 3/23: chick big 3/29: flag pulled" +2023,hidden,144,bcnh,2023-03-23,,1,nestling,"2/23: nest far back 3/16: certain only 1 chick; 3/23: chick big 3/29: flag pulled" +2023,hidden,144,bcnh,2023-03-29,,,empty,"2/23: nest far back 3/16: certain only 1 chick; 3/23: chick big 3/29: flag pulled" +2023,hidden,144,bcnh,2023-04-06,,,,"2/23: nest far back 3/16: certain only 1 chick; 3/23: chick big 3/29: flag pulled" +2023,hidden,144,bcnh,2023-04-14,,,,"2/23: nest far back 3/16: certain only 1 chick; 3/23: chick big 3/29: flag pulled" +2023,hidden,144,bcnh,2023-04-21,,,,"2/23: nest far back 3/16: certain only 1 chick; 3/23: chick big 3/29: flag pulled" +2023,hidden,144,bcnh,2023-04-28,,,,"2/23: nest far back 3/16: certain only 1 chick; 3/23: chick big 3/29: flag pulled" +2023,hidden,144,bcnh,2023-05-05,,,,"2/23: nest far back 3/16: certain only 1 chick; 3/23: chick big 3/29: flag pulled" +2023,hidden,146,rosp,2023-02-16,,,,"3/16: 1 chick dry, 1 chick hatching 4/6: 1 chick plus 4/14: chick big, ran far 4/21: flag pulled" +2023,hidden,146,rosp,2023-02-23,2,,incubating,"3/16: 1 chick dry, 1 chick hatching 4/6: 1 chick plus 4/14: chick big, ran far 4/21: flag pulled" +2023,hidden,146,rosp,2023-03-02,3,,incubating,"3/16: 1 chick dry, 1 chick hatching 4/6: 1 chick plus 4/14: chick big, ran far 4/21: flag pulled" +2023,hidden,146,rosp,2023-03-09,3,,incubating,"3/16: 1 chick dry, 1 chick hatching 4/6: 1 chick plus 4/14: chick big, ran far 4/21: flag pulled" +2023,hidden,146,rosp,2023-03-16,1,2,wet_chick,"3/16: 1 chick dry, 1 chick hatching 4/6: 1 chick plus 4/14: chick big, ran far 4/21: flag pulled" +2023,hidden,146,rosp,2023-03-23,,3,nestling,"3/16: 1 chick dry, 1 chick hatching 4/6: 1 chick plus 4/14: chick big, ran far 4/21: flag pulled" +2023,hidden,146,rosp,2023-03-29,,2,nestling,"3/16: 1 chick dry, 1 chick hatching 4/6: 1 chick plus 4/14: chick big, ran far 4/21: flag pulled" +2023,hidden,146,rosp,2023-04-06,,1,nestling,"3/16: 1 chick dry, 1 chick hatching 4/6: 1 chick plus 4/14: chick big, ran far 4/21: flag pulled" +2023,hidden,146,rosp,2023-04-14,,1,nestling,"3/16: 1 chick dry, 1 chick hatching 4/6: 1 chick plus 4/14: chick big, ran far 4/21: flag pulled" +2023,hidden,146,rosp,2023-04-21,,,empty,"3/16: 1 chick dry, 1 chick hatching 4/6: 1 chick plus 4/14: chick big, ran far 4/21: flag pulled" +2023,hidden,146,rosp,2023-04-28,,,,"3/16: 1 chick dry, 1 chick hatching 4/6: 1 chick plus 4/14: chick big, ran far 4/21: flag pulled" +2023,hidden,146,rosp,2023-05-05,,,,"3/16: 1 chick dry, 1 chick hatching 4/6: 1 chick plus 4/14: chick big, ran far 4/21: flag pulled" +2023,hidden,148,greg,2023-02-16,,,,"3/9: 3 chicks, one wet, two dry 3/16: could only confirm 2 chicks 3/23: one dead chick on the ground of unknown origin, and one chick in the nest appeared weak 4/6: 1 chick plus" +2023,hidden,148,greg,2023-02-23,3,,incubating,"3/9: 3 chicks, one wet, two dry 3/16: could only confirm 2 chicks 3/23: one dead chick on the ground of unknown origin, and one chick in the nest appeared weak 4/6: 1 chick plus" +2023,hidden,148,greg,2023-03-02,3,,incubating,"3/9: 3 chicks, one wet, two dry 3/16: could only confirm 2 chicks 3/23: one dead chick on the ground of unknown origin, and one chick in the nest appeared weak 4/6: 1 chick plus" +2023,hidden,148,greg,2023-03-09,,3,wet_chick,"3/9: 3 chicks, one wet, two dry 3/16: could only confirm 2 chicks 3/23: one dead chick on the ground of unknown origin, and one chick in the nest appeared weak 4/6: 1 chick plus" +2023,hidden,148,greg,2023-03-16,,2,nestling,"3/9: 3 chicks, one wet, two dry 3/16: could only confirm 2 chicks 3/23: one dead chick on the ground of unknown origin, and one chick in the nest appeared weak 4/6: 1 chick plus" +2023,hidden,148,greg,2023-03-23,,2,nestling,"3/9: 3 chicks, one wet, two dry 3/16: could only confirm 2 chicks 3/23: one dead chick on the ground of unknown origin, and one chick in the nest appeared weak 4/6: 1 chick plus" +2023,hidden,148,greg,2023-03-29,,2,nestling,"3/9: 3 chicks, one wet, two dry 3/16: could only confirm 2 chicks 3/23: one dead chick on the ground of unknown origin, and one chick in the nest appeared weak 4/6: 1 chick plus" +2023,hidden,148,greg,2023-04-06,,1,nestling,"3/9: 3 chicks, one wet, two dry 3/16: could only confirm 2 chicks 3/23: one dead chick on the ground of unknown origin, and one chick in the nest appeared weak 4/6: 1 chick plus" +2023,hidden,148,greg,2023-04-14,,,empty,"3/9: 3 chicks, one wet, two dry 3/16: could only confirm 2 chicks 3/23: one dead chick on the ground of unknown origin, and one chick in the nest appeared weak 4/6: 1 chick plus" +2023,hidden,148,greg,2023-04-21,,,empty,"3/9: 3 chicks, one wet, two dry 3/16: could only confirm 2 chicks 3/23: one dead chick on the ground of unknown origin, and one chick in the nest appeared weak 4/6: 1 chick plus" +2023,hidden,148,greg,2023-04-28,,,missed,"3/9: 3 chicks, one wet, two dry 3/16: could only confirm 2 chicks 3/23: one dead chick on the ground of unknown origin, and one chick in the nest appeared weak 4/6: 1 chick plus" +2023,hidden,148,greg,2023-05-05,,,,"3/9: 3 chicks, one wet, two dry 3/16: could only confirm 2 chicks 3/23: one dead chick on the ground of unknown origin, and one chick in the nest appeared weak 4/6: 1 chick plus" +2023,hidden,199,greg,2023-02-16,,,,"2/23: nest back from transect a bit; 3/2: nest gone, pulled flag" +2023,hidden,199,greg,2023-02-23,2,,incubating,"2/23: nest back from transect a bit; 3/2: nest gone, pulled flag" +2023,hidden,199,greg,2023-03-02,,,empty,"2/23: nest back from transect a bit; 3/2: nest gone, pulled flag" +2023,hidden,199,greg,2023-03-09,,,,"2/23: nest back from transect a bit; 3/2: nest gone, pulled flag" +2023,hidden,199,greg,2023-03-16,,,,"2/23: nest back from transect a bit; 3/2: nest gone, pulled flag" +2023,hidden,199,greg,2023-03-23,,,,"2/23: nest back from transect a bit; 3/2: nest gone, pulled flag" +2023,hidden,199,greg,2023-03-29,,,,"2/23: nest back from transect a bit; 3/2: nest gone, pulled flag" +2023,hidden,199,greg,2023-04-06,,,,"2/23: nest back from transect a bit; 3/2: nest gone, pulled flag" +2023,hidden,199,greg,2023-04-14,,,,"2/23: nest back from transect a bit; 3/2: nest gone, pulled flag" +2023,hidden,199,greg,2023-04-21,,,,"2/23: nest back from transect a bit; 3/2: nest gone, pulled flag" +2023,hidden,199,greg,2023-04-28,,,,"2/23: nest back from transect a bit; 3/2: nest gone, pulled flag" +2023,hidden,199,greg,2023-05-05,,,,"2/23: nest back from transect a bit; 3/2: nest gone, pulled flag" +2023,hidden,150,greg,2023-02-16,,,,"3/23: egg likely dead 3/29: egg dead 4/6: pulled flag" +2023,hidden,150,greg,2023-02-23,2,,incubating,"3/23: egg likely dead 3/29: egg dead 4/6: pulled flag" +2023,hidden,150,greg,2023-03-02,2,,incubating,"3/23: egg likely dead 3/29: egg dead 4/6: pulled flag" +2023,hidden,150,greg,2023-03-09,2,,incubating,"3/23: egg likely dead 3/29: egg dead 4/6: pulled flag" +2023,hidden,150,greg,2023-03-16,1,1,hatching,"3/23: egg likely dead 3/29: egg dead 4/6: pulled flag" +2023,hidden,150,greg,2023-03-23,1,1,nestling,"3/23: egg likely dead 3/29: egg dead 4/6: pulled flag" +2023,hidden,150,greg,2023-03-29,,,empty,"3/23: egg likely dead 3/29: egg dead 4/6: pulled flag" +2023,hidden,150,greg,2023-04-06,,,pulled,"3/23: egg likely dead 3/29: egg dead 4/6: pulled flag" +2023,hidden,150,greg,2023-04-14,,,,"3/23: egg likely dead 3/29: egg dead 4/6: pulled flag" +2023,hidden,150,greg,2023-04-21,,,,"3/23: egg likely dead 3/29: egg dead 4/6: pulled flag" +2023,hidden,150,greg,2023-04-28,,,,"3/23: egg likely dead 3/29: egg dead 4/6: pulled flag" +2023,hidden,150,greg,2023-05-05,,,,"3/23: egg likely dead 3/29: egg dead 4/6: pulled flag" +2023,hidden,331,bcnh,2023-02-16,,,,"4/6: pulled flag" +2023,hidden,331,bcnh,2023-02-23,,,,"4/6: pulled flag" +2023,hidden,331,bcnh,2023-03-02,3,,incubating,"4/6: pulled flag" +2023,hidden,331,bcnh,2023-03-09,3,,incubating,"4/6: pulled flag" +2023,hidden,331,bcnh,2023-03-16,1,2,hatching,"4/6: pulled flag" +2023,hidden,331,bcnh,2023-03-23,,2,nestling,"4/6: pulled flag" +2023,hidden,331,bcnh,2023-03-29,,2,nestling,"4/6: pulled flag" +2023,hidden,331,bcnh,2023-04-06,,,empty,"4/6: pulled flag" +2023,hidden,331,bcnh,2023-04-14,,,,"4/6: pulled flag" +2023,hidden,331,bcnh,2023-04-21,,,,"4/6: pulled flag" +2023,hidden,331,bcnh,2023-04-28,,,,"4/6: pulled flag" +2023,hidden,331,bcnh,2023-05-05,,,,"4/6: pulled flag" +2023,hidden,322,bcnh,2023-02-16,,,,"3/29: 2 chicks certain" +2023,hidden,322,bcnh,2023-02-23,,,,"3/29: 2 chicks certain" +2023,hidden,322,bcnh,2023-03-02,3,,incubating,"3/29: 2 chicks certain" +2023,hidden,322,bcnh,2023-03-09,3,,incubating,"3/29: 2 chicks certain" +2023,hidden,322,bcnh,2023-03-16,3,,incubating,"3/29: 2 chicks certain" +2023,hidden,322,bcnh,2023-03-23,,1,nestling,"3/29: 2 chicks certain" +2023,hidden,322,bcnh,2023-03-29,,2,nestling,"3/29: 2 chicks certain" +2023,hidden,322,bcnh,2023-04-06,,1,nestling,"3/29: 2 chicks certain" +2023,hidden,322,bcnh,2023-04-14,,,empty,"3/29: 2 chicks certain" +2023,hidden,322,bcnh,2023-04-21,,,empty,"3/29: 2 chicks certain" +2023,hidden,322,bcnh,2023-04-28,,,missed,"3/29: 2 chicks certain" +2023,hidden,322,bcnh,2023-05-05,,,,"3/29: 2 chicks certain" +2023,hidden,324,greg,2023-02-16,,,,"4/14: 1 big chick in area, but also could have come from 88; 5/5: One live chick and one dead between 88 and 324" +2023,hidden,324,greg,2023-02-23,,,,"4/14: 1 big chick in area, but also could have come from 88; 5/5: One live chick and one dead between 88 and 324" +2023,hidden,324,greg,2023-03-02,2,,incubating,"4/14: 1 big chick in area, but also could have come from 88; 5/5: One live chick and one dead between 88 and 324" +2023,hidden,324,greg,2023-03-09,,2,nestling,"4/14: 1 big chick in area, but also could have come from 88; 5/5: One live chick and one dead between 88 and 324" +2023,hidden,324,greg,2023-03-16,,2,nestling,"4/14: 1 big chick in area, but also could have come from 88; 5/5: One live chick and one dead between 88 and 324" +2023,hidden,324,greg,2023-03-23,,2,nestling,"4/14: 1 big chick in area, but also could have come from 88; 5/5: One live chick and one dead between 88 and 324" +2023,hidden,324,greg,2023-03-29,,1,nestling,"4/14: 1 big chick in area, but also could have come from 88; 5/5: One live chick and one dead between 88 and 324" +2023,hidden,324,greg,2023-04-06,,1,nestling,"4/14: 1 big chick in area, but also could have come from 88; 5/5: One live chick and one dead between 88 and 324" +2023,hidden,324,greg,2023-04-14,,,empty,"4/14: 1 big chick in area, but also could have come from 88; 5/5: One live chick and one dead between 88 and 324" +2023,hidden,324,greg,2023-04-21,,1,nestling,"4/14: 1 big chick in area, but also could have come from 88; 5/5: One live chick and one dead between 88 and 324" +2023,hidden,324,greg,2023-04-28,,1,branchling,"4/14: 1 big chick in area, but also could have come from 88; 5/5: One live chick and one dead between 88 and 324" +2023,hidden,324,greg,2023-05-05,,,empty,"4/14: 1 big chick in area, but also could have come from 88; 5/5: One live chick and one dead between 88 and 324" +2023,hidden,333,bcnh,2023-02-16,,,, +2023,hidden,333,bcnh,2023-02-23,,,, +2023,hidden,333,bcnh,2023-03-02,3,,incubating, +2023,hidden,333,bcnh,2023-03-09,3,,incubating, +2023,hidden,333,bcnh,2023-03-16,3,,incubating, +2023,hidden,333,bcnh,2023-03-23,,3,nestling, +2023,hidden,333,bcnh,2023-03-29,,2,nestling, +2023,hidden,333,bcnh,2023-04-06,,1,nestling, +2023,hidden,333,bcnh,2023-04-14,,,empty, +2023,hidden,333,bcnh,2023-04-21,,,empty, +2023,hidden,333,bcnh,2023-04-28,,,missed, +2023,hidden,333,bcnh,2023-05-05,,,, +2023,hidden,358,greg,2023-02-16,,,,"3/23: 1 broken eggshell in nest 4/6: pulled flag" +2023,hidden,358,greg,2023-02-23,,,,"3/23: 1 broken eggshell in nest 4/6: pulled flag" +2023,hidden,358,greg,2023-03-02,,,,"3/23: 1 broken eggshell in nest 4/6: pulled flag" +2023,hidden,358,greg,2023-03-09,1,,incubating,"3/23: 1 broken eggshell in nest 4/6: pulled flag" +2023,hidden,358,greg,2023-03-16,2,,incubating,"3/23: 1 broken eggshell in nest 4/6: pulled flag" +2023,hidden,358,greg,2023-03-23,,,empty,"3/23: 1 broken eggshell in nest 4/6: pulled flag" +2023,hidden,358,greg,2023-03-29,,,empty,"3/23: 1 broken eggshell in nest 4/6: pulled flag" +2023,hidden,358,greg,2023-04-06,,,pulled,"3/23: 1 broken eggshell in nest 4/6: pulled flag" +2023,hidden,358,greg,2023-04-14,,,,"3/23: 1 broken eggshell in nest 4/6: pulled flag" +2023,hidden,358,greg,2023-04-21,,,,"3/23: 1 broken eggshell in nest 4/6: pulled flag" +2023,hidden,358,greg,2023-04-28,,,,"3/23: 1 broken eggshell in nest 4/6: pulled flag" +2023,hidden,358,greg,2023-05-05,,,,"3/23: 1 broken eggshell in nest 4/6: pulled flag" +2023,hidden,360,greg,2023-02-16,,,,"4/6: couldn't see any chicks moving around in area" +2023,hidden,360,greg,2023-02-23,,,,"4/6: couldn't see any chicks moving around in area" +2023,hidden,360,greg,2023-03-02,,,,"4/6: couldn't see any chicks moving around in area" +2023,hidden,360,greg,2023-03-09,3,,incubating,"4/6: couldn't see any chicks moving around in area" +2023,hidden,360,greg,2023-03-16,,3,nestling,"4/6: couldn't see any chicks moving around in area" +2023,hidden,360,greg,2023-03-23,,2,nestling,"4/6: couldn't see any chicks moving around in area" +2023,hidden,360,greg,2023-03-29,,,empty,"4/6: couldn't see any chicks moving around in area" +2023,hidden,360,greg,2023-04-06,,,empty,"4/6: couldn't see any chicks moving around in area" +2023,hidden,360,greg,2023-04-14,,,empty,"4/6: couldn't see any chicks moving around in area" +2023,hidden,360,greg,2023-04-21,,,empty,"4/6: couldn't see any chicks moving around in area" +2023,hidden,360,greg,2023-04-28,,,pulled,"4/6: couldn't see any chicks moving around in area" +2023,hidden,360,greg,2023-05-05,,,,"4/6: couldn't see any chicks moving around in area" +2023,hidden,374,greg,2023-02-16,,,,"3/23 and 3/29: flag on the ground" +2023,hidden,374,greg,2023-02-23,,,,"3/23 and 3/29: flag on the ground" +2023,hidden,374,greg,2023-03-02,,,,"3/23 and 3/29: flag on the ground" +2023,hidden,374,greg,2023-03-09,2,,incubating,"3/23 and 3/29: flag on the ground" +2023,hidden,374,greg,2023-03-16,,,missed,"3/23 and 3/29: flag on the ground" +2023,hidden,374,greg,2023-03-23,,,unknown,"3/23 and 3/29: flag on the ground" +2023,hidden,374,greg,2023-03-29,,,unknown,"3/23 and 3/29: flag on the ground" +2023,hidden,374,greg,2023-04-06,,,,"3/23 and 3/29: flag on the ground" +2023,hidden,374,greg,2023-04-14,,,,"3/23 and 3/29: flag on the ground" +2023,hidden,374,greg,2023-04-21,,,,"3/23 and 3/29: flag on the ground" +2023,hidden,374,greg,2023-04-28,,,,"3/23 and 3/29: flag on the ground" +2023,hidden,374,greg,2023-05-05,,,,"3/23 and 3/29: flag on the ground" +2023,hidden,376,greg,2023-02-16,,,,"3/29: nest gone 4/6: pulled flag" +2023,hidden,376,greg,2023-02-23,,,,"3/29: nest gone 4/6: pulled flag" +2023,hidden,376,greg,2023-03-02,,,,"3/29: nest gone 4/6: pulled flag" +2023,hidden,376,greg,2023-03-09,3,,incubating,"3/29: nest gone 4/6: pulled flag" +2023,hidden,376,greg,2023-03-16,3,,incubating,"3/29: nest gone 4/6: pulled flag" +2023,hidden,376,greg,2023-03-23,3,,incubating,"3/29: nest gone 4/6: pulled flag" +2023,hidden,376,greg,2023-03-29,,,empty,"3/29: nest gone 4/6: pulled flag" +2023,hidden,376,greg,2023-04-06,,,pulled,"3/29: nest gone 4/6: pulled flag" +2023,hidden,376,greg,2023-04-14,,,,"3/29: nest gone 4/6: pulled flag" +2023,hidden,376,greg,2023-04-21,,,,"3/29: nest gone 4/6: pulled flag" +2023,hidden,376,greg,2023-04-28,,,,"3/29: nest gone 4/6: pulled flag" +2023,hidden,376,greg,2023-05-05,,,,"3/29: nest gone 4/6: pulled flag" +2023,hidden,378,smwh,2023-02-16,,,,"4/21: flag pulled" +2023,hidden,378,smwh,2023-02-23,,,,"4/21: flag pulled" +2023,hidden,378,smwh,2023-03-02,,,,"4/21: flag pulled" +2023,hidden,378,smwh,2023-03-09,1,,incubating,"4/21: flag pulled" +2023,hidden,378,smwh,2023-03-16,4,,incubating,"4/21: flag pulled" +2023,hidden,378,smwh,2023-03-23,4,,incubating,"4/21: flag pulled" +2023,hidden,378,smwh,2023-03-29,4,,incubating,"4/21: flag pulled" +2023,hidden,378,smwh,2023-04-06,,4,nestling,"4/21: flag pulled" +2023,hidden,378,smwh,2023-04-14,,,empty,"4/21: flag pulled" +2023,hidden,378,smwh,2023-04-21,,,empty,"4/21: flag pulled" +2023,hidden,378,smwh,2023-04-28,,,,"4/21: flag pulled" +2023,hidden,378,smwh,2023-05-05,,,,"4/21: flag pulled" +2023,hidden,380,smwh,2023-02-16,,,,"4/21: flag pulled" +2023,hidden,380,smwh,2023-02-23,,,,"4/21: flag pulled" +2023,hidden,380,smwh,2023-03-02,,,,"4/21: flag pulled" +2023,hidden,380,smwh,2023-03-09,1,,incubating,"4/21: flag pulled" +2023,hidden,380,smwh,2023-03-16,3,,incubating,"4/21: flag pulled" +2023,hidden,380,smwh,2023-03-23,3,,incubating,"4/21: flag pulled" +2023,hidden,380,smwh,2023-03-29,3,,incubating,"4/21: flag pulled" +2023,hidden,380,smwh,2023-04-06,,3,nestling,"4/21: flag pulled" +2023,hidden,380,smwh,2023-04-14,,2,nestling,"4/21: flag pulled" +2023,hidden,380,smwh,2023-04-21,,,empty,"4/21: flag pulled" +2023,hidden,380,smwh,2023-04-28,,,,"4/21: flag pulled" +2023,hidden,380,smwh,2023-05-05,,,,"4/21: flag pulled" +2023,hidden,382,greg,2023-02-16,,,,"3/16: can only confirm 2 chicks 3/23: one dead chick in nest; 4/21: 1 large chick nearby, 4/28: large GREG chick nearby" +2023,hidden,382,greg,2023-02-23,,,,"3/16: can only confirm 2 chicks 3/23: one dead chick in nest; 4/21: 1 large chick nearby, 4/28: large GREG chick nearby" +2023,hidden,382,greg,2023-03-02,,,,"3/16: can only confirm 2 chicks 3/23: one dead chick in nest; 4/21: 1 large chick nearby, 4/28: large GREG chick nearby" +2023,hidden,382,greg,2023-03-09,3,,incubating,"3/16: can only confirm 2 chicks 3/23: one dead chick in nest; 4/21: 1 large chick nearby, 4/28: large GREG chick nearby" +2023,hidden,382,greg,2023-03-16,,2,nestling,"3/16: can only confirm 2 chicks 3/23: one dead chick in nest; 4/21: 1 large chick nearby, 4/28: large GREG chick nearby" +2023,hidden,382,greg,2023-03-23,,2,nestling,"3/16: can only confirm 2 chicks 3/23: one dead chick in nest; 4/21: 1 large chick nearby, 4/28: large GREG chick nearby" +2023,hidden,382,greg,2023-03-29,,2,nestling,"3/16: can only confirm 2 chicks 3/23: one dead chick in nest; 4/21: 1 large chick nearby, 4/28: large GREG chick nearby" +2023,hidden,382,greg,2023-04-06,,2,nestling,"3/16: can only confirm 2 chicks 3/23: one dead chick in nest; 4/21: 1 large chick nearby, 4/28: large GREG chick nearby" +2023,hidden,382,greg,2023-04-14,,2,nestling,"3/16: can only confirm 2 chicks 3/23: one dead chick in nest; 4/21: 1 large chick nearby, 4/28: large GREG chick nearby" +2023,hidden,382,greg,2023-04-21,,,empty,"3/16: can only confirm 2 chicks 3/23: one dead chick in nest; 4/21: 1 large chick nearby, 4/28: large GREG chick nearby" +2023,hidden,382,greg,2023-04-28,,,pulled,"3/16: can only confirm 2 chicks 3/23: one dead chick in nest; 4/21: 1 large chick nearby, 4/28: large GREG chick nearby" +2023,hidden,382,greg,2023-05-05,,,,"3/16: can only confirm 2 chicks 3/23: one dead chick in nest; 4/21: 1 large chick nearby, 4/28: large GREG chick nearby" +2023,hidden,384,smwh,2023-02-16,,,,"4/6: Chicks one to two weeks old (probably were hatched out on last check when nest was missed)" +2023,hidden,384,smwh,2023-02-23,,,,"4/6: Chicks one to two weeks old (probably were hatched out on last check when nest was missed)" +2023,hidden,384,smwh,2023-03-02,,,,"4/6: Chicks one to two weeks old (probably were hatched out on last check when nest was missed)" +2023,hidden,384,smwh,2023-03-09,3,,incubating,"4/6: Chicks one to two weeks old (probably were hatched out on last check when nest was missed)" +2023,hidden,384,smwh,2023-03-16,4,,incubating,"4/6: Chicks one to two weeks old (probably were hatched out on last check when nest was missed)" +2023,hidden,384,smwh,2023-03-23,4,,incubating,"4/6: Chicks one to two weeks old (probably were hatched out on last check when nest was missed)" +2023,hidden,384,smwh,2023-03-29,,,missed,"4/6: Chicks one to two weeks old (probably were hatched out on last check when nest was missed)" +2023,hidden,384,smwh,2023-04-06,,4,nestling,"4/6: Chicks one to two weeks old (probably were hatched out on last check when nest was missed)" +2023,hidden,384,smwh,2023-04-14,,,empty,"4/6: Chicks one to two weeks old (probably were hatched out on last check when nest was missed)" +2023,hidden,384,smwh,2023-04-21,,,empty,"4/6: Chicks one to two weeks old (probably were hatched out on last check when nest was missed)" +2023,hidden,384,smwh,2023-04-28,,,pulled,"4/6: Chicks one to two weeks old (probably were hatched out on last check when nest was missed)" +2023,hidden,384,smwh,2023-05-05,,,,"4/6: Chicks one to two weeks old (probably were hatched out on last check when nest was missed)" +2023,hidden,386,smwh,2023-02-16,,,,"4/21: 1 dead chick" +2023,hidden,386,smwh,2023-02-23,,,,"4/21: 1 dead chick" +2023,hidden,386,smwh,2023-03-02,,,,"4/21: 1 dead chick" +2023,hidden,386,smwh,2023-03-09,3,,incubating,"4/21: 1 dead chick" +2023,hidden,386,smwh,2023-03-16,4,,incubating,"4/21: 1 dead chick" +2023,hidden,386,smwh,2023-03-23,4,,incubating,"4/21: 1 dead chick" +2023,hidden,386,smwh,2023-03-29,3,1,wet_chick,"4/21: 1 dead chick" +2023,hidden,386,smwh,2023-04-06,,4,nestling,"4/21: 1 dead chick" +2023,hidden,386,smwh,2023-04-14,,3,nestling,"4/21: 1 dead chick" +2023,hidden,386,smwh,2023-04-21,,1,nestling,"4/21: 1 dead chick" +2023,hidden,386,smwh,2023-04-28,,,pulled,"4/21: 1 dead chick" +2023,hidden,386,smwh,2023-05-05,,,,"4/21: 1 dead chick" +2023,hidden,388,bcnh,2023-02-16,,,,"3/16: both chicks dry 3/29: one dead chick 4/6: pulled flag" +2023,hidden,388,bcnh,2023-02-23,,,,"3/16: both chicks dry 3/29: one dead chick 4/6: pulled flag" +2023,hidden,388,bcnh,2023-03-02,,,,"3/16: both chicks dry 3/29: one dead chick 4/6: pulled flag" +2023,hidden,388,bcnh,2023-03-09,2,,incubating,"3/16: both chicks dry 3/29: one dead chick 4/6: pulled flag" +2023,hidden,388,bcnh,2023-03-16,,2,chick_dry,"3/16: both chicks dry 3/29: one dead chick 4/6: pulled flag" +2023,hidden,388,bcnh,2023-03-23,,2,nestling,"3/16: both chicks dry 3/29: one dead chick 4/6: pulled flag" +2023,hidden,388,bcnh,2023-03-29,,,empty,"3/16: both chicks dry 3/29: one dead chick 4/6: pulled flag" +2023,hidden,388,bcnh,2023-04-06,,,pulled,"3/16: both chicks dry 3/29: one dead chick 4/6: pulled flag" +2023,hidden,388,bcnh,2023-04-14,,,,"3/16: both chicks dry 3/29: one dead chick 4/6: pulled flag" +2023,hidden,388,bcnh,2023-04-21,,,,"3/16: both chicks dry 3/29: one dead chick 4/6: pulled flag" +2023,hidden,388,bcnh,2023-04-28,,,,"3/16: both chicks dry 3/29: one dead chick 4/6: pulled flag" +2023,hidden,388,bcnh,2023-05-05,,,,"3/16: both chicks dry 3/29: one dead chick 4/6: pulled flag" +2023,hidden,390,bcnh,2023-02-16,,,,"4/14: pulled flag" +2023,hidden,390,bcnh,2023-02-23,,,,"4/14: pulled flag" +2023,hidden,390,bcnh,2023-03-02,,,,"4/14: pulled flag" +2023,hidden,390,bcnh,2023-03-09,3,,incubating,"4/14: pulled flag" +2023,hidden,390,bcnh,2023-03-16,2,,incubating,"4/14: pulled flag" +2023,hidden,390,bcnh,2023-03-23,4,,incubating,"4/14: pulled flag" +2023,hidden,390,bcnh,2023-03-29,4,,incubating,"4/14: pulled flag" +2023,hidden,390,bcnh,2023-04-06,4,,incubating,"4/14: pulled flag" +2023,hidden,390,bcnh,2023-04-14,,,empty,"4/14: pulled flag" +2023,hidden,390,bcnh,2023-04-21,,,,"4/14: pulled flag" +2023,hidden,390,bcnh,2023-04-28,,,,"4/14: pulled flag" +2023,hidden,390,bcnh,2023-05-05,,,,"4/14: pulled flag" +2023,hidden,392,trhe,2023-02-16,,,,"3/9: eggs a little extra blue 3/23: TRHE at the top of nest tree 4/14: pulled flag" +2023,hidden,392,trhe,2023-02-23,,,,"3/9: eggs a little extra blue 3/23: TRHE at the top of nest tree 4/14: pulled flag" +2023,hidden,392,trhe,2023-03-02,,,,"3/9: eggs a little extra blue 3/23: TRHE at the top of nest tree 4/14: pulled flag" +2023,hidden,392,trhe,2023-03-09,2,,incubating,"3/9: eggs a little extra blue 3/23: TRHE at the top of nest tree 4/14: pulled flag" +2023,hidden,392,trhe,2023-03-16,4,,incubating,"3/9: eggs a little extra blue 3/23: TRHE at the top of nest tree 4/14: pulled flag" +2023,hidden,392,trhe,2023-03-23,4,,incubating,"3/9: eggs a little extra blue 3/23: TRHE at the top of nest tree 4/14: pulled flag" +2023,hidden,392,trhe,2023-03-29,4,,incubating,"3/9: eggs a little extra blue 3/23: TRHE at the top of nest tree 4/14: pulled flag" +2023,hidden,392,trhe,2023-04-06,,4,nestling,"3/9: eggs a little extra blue 3/23: TRHE at the top of nest tree 4/14: pulled flag" +2023,hidden,392,trhe,2023-04-14,,,empty,"3/9: eggs a little extra blue 3/23: TRHE at the top of nest tree 4/14: pulled flag" +2023,hidden,392,trhe,2023-04-21,,,,"3/9: eggs a little extra blue 3/23: TRHE at the top of nest tree 4/14: pulled flag" +2023,hidden,392,trhe,2023-04-28,,,,"3/9: eggs a little extra blue 3/23: TRHE at the top of nest tree 4/14: pulled flag" +2023,hidden,392,trhe,2023-05-05,,,,"3/9: eggs a little extra blue 3/23: TRHE at the top of nest tree 4/14: pulled flag" +2023,hidden,540,whib,2023-02-16,,,, +2023,hidden,540,whib,2023-02-23,,,, +2023,hidden,540,whib,2023-03-02,,,, +2023,hidden,540,whib,2023-03-09,,,, +2023,hidden,540,whib,2023-03-16,,,, +2023,hidden,540,whib,2023-03-23,2,,incubating, +2023,hidden,540,whib,2023-03-29,,,empty, +2023,hidden,540,whib,2023-04-06,,,empty, +2023,hidden,540,whib,2023-04-14,,,empty, +2023,hidden,540,whib,2023-04-21,,,empty, +2023,hidden,540,whib,2023-04-28,,,pulled, +2023,hidden,540,whib,2023-05-05,,,, +2023,hidden,538,whib,2023-02-16,,,, +2023,hidden,538,whib,2023-02-23,,,, +2023,hidden,538,whib,2023-03-02,,,, +2023,hidden,538,whib,2023-03-09,,,, +2023,hidden,538,whib,2023-03-16,,,, +2023,hidden,538,whib,2023-03-23,2,,incubating, +2023,hidden,538,whib,2023-03-29,,,empty, +2023,hidden,538,whib,2023-04-06,,,empty, +2023,hidden,538,whib,2023-04-14,,,empty, +2023,hidden,538,whib,2023-04-21,,,empty, +2023,hidden,538,whib,2023-04-28,,,pulled, +2023,hidden,538,whib,2023-05-05,,,, +2023,hidden,542,whib,2023-02-16,,,,"4/21: egg probably dead; 4/28: flag pulled" +2023,hidden,542,whib,2023-02-23,,,,"4/21: egg probably dead; 4/28: flag pulled" +2023,hidden,542,whib,2023-03-02,,,,"4/21: egg probably dead; 4/28: flag pulled" +2023,hidden,542,whib,2023-03-09,,,,"4/21: egg probably dead; 4/28: flag pulled" +2023,hidden,542,whib,2023-03-16,,,,"4/21: egg probably dead; 4/28: flag pulled" +2023,hidden,542,whib,2023-03-23,2,,incubating,"4/21: egg probably dead; 4/28: flag pulled" +2023,hidden,542,whib,2023-03-29,2,,incubating,"4/21: egg probably dead; 4/28: flag pulled" +2023,hidden,542,whib,2023-04-06,1,,incubating,"4/21: egg probably dead; 4/28: flag pulled" +2023,hidden,542,whib,2023-04-14,1,,incubating,"4/21: egg probably dead; 4/28: flag pulled" +2023,hidden,542,whib,2023-04-21,1,,incubating,"4/21: egg probably dead; 4/28: flag pulled" +2023,hidden,542,whib,2023-04-28,,,empty,"4/21: egg probably dead; 4/28: flag pulled" +2023,hidden,542,whib,2023-05-05,,,,"4/21: egg probably dead; 4/28: flag pulled" +2023,hidden,544,whib,2023-02-16,,,,"4/14: both chicks dry, remaining egg very small" +2023,hidden,544,whib,2023-02-23,,,,"4/14: both chicks dry, remaining egg very small" +2023,hidden,544,whib,2023-03-02,,,,"4/14: both chicks dry, remaining egg very small" +2023,hidden,544,whib,2023-03-09,,,,"4/14: both chicks dry, remaining egg very small" +2023,hidden,544,whib,2023-03-16,,,,"4/14: both chicks dry, remaining egg very small" +2023,hidden,544,whib,2023-03-23,3,,incubating,"4/14: both chicks dry, remaining egg very small" +2023,hidden,544,whib,2023-03-29,3,,incubating,"4/14: both chicks dry, remaining egg very small" +2023,hidden,544,whib,2023-04-06,3,,incubating,"4/14: both chicks dry, remaining egg very small" +2023,hidden,544,whib,2023-04-14,1,2,chick_dry,"4/14: both chicks dry, remaining egg very small" +2023,hidden,544,whib,2023-04-21,,,empty,"4/14: both chicks dry, remaining egg very small" +2023,hidden,544,whib,2023-04-28,,,pulled,"4/14: both chicks dry, remaining egg very small" +2023,hidden,544,whib,2023-05-05,,,,"4/14: both chicks dry, remaining egg very small" +2023,hidden,548,whib,2023-02-16,,,,"4/14: both chicks dry; 4/28: flag pulled" +2023,hidden,548,whib,2023-02-23,,,,"4/14: both chicks dry; 4/28: flag pulled" +2023,hidden,548,whib,2023-03-02,,,,"4/14: both chicks dry; 4/28: flag pulled" +2023,hidden,548,whib,2023-03-09,,,,"4/14: both chicks dry; 4/28: flag pulled" +2023,hidden,548,whib,2023-03-16,,,,"4/14: both chicks dry; 4/28: flag pulled" +2023,hidden,548,whib,2023-03-23,2,,incubating,"4/14: both chicks dry; 4/28: flag pulled" +2023,hidden,548,whib,2023-03-29,2,,incubating,"4/14: both chicks dry; 4/28: flag pulled" +2023,hidden,548,whib,2023-04-06,2,,incubating,"4/14: both chicks dry; 4/28: flag pulled" +2023,hidden,548,whib,2023-04-14,,2,chick_dry,"4/14: both chicks dry; 4/28: flag pulled" +2023,hidden,548,whib,2023-04-21,,2,nestling,"4/14: both chicks dry; 4/28: flag pulled" +2023,hidden,548,whib,2023-04-28,,,empty,"4/14: both chicks dry; 4/28: flag pulled" +2023,hidden,548,whib,2023-05-05,,,,"4/14: both chicks dry; 4/28: flag pulled" +2023,hidden,546,whib,2023-02-16,,,,"4/14: leaves on top of eggs; 4/21: eggs look abandoned; 4/28: flag pulled" +2023,hidden,546,whib,2023-02-23,,,,"4/14: leaves on top of eggs; 4/21: eggs look abandoned; 4/28: flag pulled" +2023,hidden,546,whib,2023-03-02,,,,"4/14: leaves on top of eggs; 4/21: eggs look abandoned; 4/28: flag pulled" +2023,hidden,546,whib,2023-03-09,,,,"4/14: leaves on top of eggs; 4/21: eggs look abandoned; 4/28: flag pulled" +2023,hidden,546,whib,2023-03-16,,,,"4/14: leaves on top of eggs; 4/21: eggs look abandoned; 4/28: flag pulled" +2023,hidden,546,whib,2023-03-23,2,,incubating,"4/14: leaves on top of eggs; 4/21: eggs look abandoned; 4/28: flag pulled" +2023,hidden,546,whib,2023-03-29,2,,incubating,"4/14: leaves on top of eggs; 4/21: eggs look abandoned; 4/28: flag pulled" +2023,hidden,546,whib,2023-04-06,2,,incubating,"4/14: leaves on top of eggs; 4/21: eggs look abandoned; 4/28: flag pulled" +2023,hidden,546,whib,2023-04-14,2,,incubating,"4/14: leaves on top of eggs; 4/21: eggs look abandoned; 4/28: flag pulled" +2023,hidden,546,whib,2023-04-21,2,,incubating,"4/14: leaves on top of eggs; 4/21: eggs look abandoned; 4/28: flag pulled" +2023,hidden,546,whib,2023-04-28,,,empty,"4/14: leaves on top of eggs; 4/21: eggs look abandoned; 4/28: flag pulled" +2023,hidden,546,whib,2023-05-05,,,,"4/14: leaves on top of eggs; 4/21: eggs look abandoned; 4/28: flag pulled" +2023,hidden,552,whib,2023-02-16,,,,"4/6: pulled flag" +2023,hidden,552,whib,2023-02-23,,,,"4/6: pulled flag" +2023,hidden,552,whib,2023-03-02,,,,"4/6: pulled flag" +2023,hidden,552,whib,2023-03-09,,,,"4/6: pulled flag" +2023,hidden,552,whib,2023-03-16,,,,"4/6: pulled flag" +2023,hidden,552,whib,2023-03-23,2,,incubating,"4/6: pulled flag" +2023,hidden,552,whib,2023-03-29,,,empty,"4/6: pulled flag" +2023,hidden,552,whib,2023-04-06,,,empty,"4/6: pulled flag" +2023,hidden,552,whib,2023-04-14,,,,"4/6: pulled flag" +2023,hidden,552,whib,2023-04-21,,,,"4/6: pulled flag" +2023,hidden,552,whib,2023-04-28,,,,"4/6: pulled flag" +2023,hidden,552,whib,2023-05-05,,,,"4/6: pulled flag" +2023,hidden,550,whib,2023-02-16,,,,"4/6: pulled flag" +2023,hidden,550,whib,2023-02-23,,,,"4/6: pulled flag" +2023,hidden,550,whib,2023-03-02,,,,"4/6: pulled flag" +2023,hidden,550,whib,2023-03-09,,,,"4/6: pulled flag" +2023,hidden,550,whib,2023-03-16,,,,"4/6: pulled flag" +2023,hidden,550,whib,2023-03-23,3,,incubating,"4/6: pulled flag" +2023,hidden,550,whib,2023-03-29,,,empty,"4/6: pulled flag" +2023,hidden,550,whib,2023-04-06,,,empty,"4/6: pulled flag" +2023,hidden,550,whib,2023-04-14,,,,"4/6: pulled flag" +2023,hidden,550,whib,2023-04-21,,,,"4/6: pulled flag" +2023,hidden,550,whib,2023-04-28,,,,"4/6: pulled flag" +2023,hidden,550,whib,2023-05-05,,,,"4/6: pulled flag" +2023,hidden,554,whib,2023-02-16,,,,"4/6: pulled flag" +2023,hidden,554,whib,2023-02-23,,,,"4/6: pulled flag" +2023,hidden,554,whib,2023-03-02,,,,"4/6: pulled flag" +2023,hidden,554,whib,2023-03-09,,,,"4/6: pulled flag" +2023,hidden,554,whib,2023-03-16,,,,"4/6: pulled flag" +2023,hidden,554,whib,2023-03-23,2,,incubating,"4/6: pulled flag" +2023,hidden,554,whib,2023-03-29,,,empty,"4/6: pulled flag" +2023,hidden,554,whib,2023-04-06,,,empty,"4/6: pulled flag" +2023,hidden,554,whib,2023-04-14,,,,"4/6: pulled flag" +2023,hidden,554,whib,2023-04-21,,,,"4/6: pulled flag" +2023,hidden,554,whib,2023-04-28,,,,"4/6: pulled flag" +2023,hidden,554,whib,2023-05-05,,,,"4/6: pulled flag" +2023,hidden,556,whib,2023-02-16,,,,"3/29: nest dry 4/6: pulled flag" +2023,hidden,556,whib,2023-02-23,,,,"3/29: nest dry 4/6: pulled flag" +2023,hidden,556,whib,2023-03-02,,,,"3/29: nest dry 4/6: pulled flag" +2023,hidden,556,whib,2023-03-09,,,,"3/29: nest dry 4/6: pulled flag" +2023,hidden,556,whib,2023-03-16,,,,"3/29: nest dry 4/6: pulled flag" +2023,hidden,556,whib,2023-03-23,2,,incubating,"3/29: nest dry 4/6: pulled flag" +2023,hidden,556,whib,2023-03-29,2,,incubating,"3/29: nest dry 4/6: pulled flag" +2023,hidden,556,whib,2023-04-06,,,empty,"3/29: nest dry 4/6: pulled flag" +2023,hidden,556,whib,2023-04-14,,,,"3/29: nest dry 4/6: pulled flag" +2023,hidden,556,whib,2023-04-21,,,,"3/29: nest dry 4/6: pulled flag" +2023,hidden,556,whib,2023-04-28,,,,"3/29: nest dry 4/6: pulled flag" +2023,hidden,556,whib,2023-05-05,,,,"3/29: nest dry 4/6: pulled flag" +2023,hidden,558,whib,2023-02-16,,,,"4/6: pulled flag" +2023,hidden,558,whib,2023-02-23,,,,"4/6: pulled flag" +2023,hidden,558,whib,2023-03-02,,,,"4/6: pulled flag" +2023,hidden,558,whib,2023-03-09,,,,"4/6: pulled flag" +2023,hidden,558,whib,2023-03-16,,,,"4/6: pulled flag" +2023,hidden,558,whib,2023-03-23,2,,incubating,"4/6: pulled flag" +2023,hidden,558,whib,2023-03-29,,,empty,"4/6: pulled flag" +2023,hidden,558,whib,2023-04-06,,,empty,"4/6: pulled flag" +2023,hidden,558,whib,2023-04-14,,,,"4/6: pulled flag" +2023,hidden,558,whib,2023-04-21,,,,"4/6: pulled flag" +2023,hidden,558,whib,2023-04-28,,,,"4/6: pulled flag" +2023,hidden,558,whib,2023-05-05,,,,"4/6: pulled flag" +2023,hidden,560,whib,2023-02-16,,,,"3/29: nest dry 4/14: eggshell in nest; 4/21: flag pulled" +2023,hidden,560,whib,2023-02-23,,,,"3/29: nest dry 4/14: eggshell in nest; 4/21: flag pulled" +2023,hidden,560,whib,2023-03-02,,,,"3/29: nest dry 4/14: eggshell in nest; 4/21: flag pulled" +2023,hidden,560,whib,2023-03-09,,,,"3/29: nest dry 4/14: eggshell in nest; 4/21: flag pulled" +2023,hidden,560,whib,2023-03-16,,,,"3/29: nest dry 4/14: eggshell in nest; 4/21: flag pulled" +2023,hidden,560,whib,2023-03-23,2,,incubating,"3/29: nest dry 4/14: eggshell in nest; 4/21: flag pulled" +2023,hidden,560,whib,2023-03-29,2,,incubating,"3/29: nest dry 4/14: eggshell in nest; 4/21: flag pulled" +2023,hidden,560,whib,2023-04-06,2,,incubating,"3/29: nest dry 4/14: eggshell in nest; 4/21: flag pulled" +2023,hidden,560,whib,2023-04-14,,,empty,"3/29: nest dry 4/14: eggshell in nest; 4/21: flag pulled" +2023,hidden,560,whib,2023-04-21,,,empty,"3/29: nest dry 4/14: eggshell in nest; 4/21: flag pulled" +2023,hidden,560,whib,2023-04-28,,,,"3/29: nest dry 4/14: eggshell in nest; 4/21: flag pulled" +2023,hidden,560,whib,2023-05-05,,,,"3/29: nest dry 4/14: eggshell in nest; 4/21: flag pulled" +2023,hidden,564,whib,2023-02-16,,,,"3/29: nest dry; 4/28: flag pulled" +2023,hidden,564,whib,2023-02-23,,,,"3/29: nest dry; 4/28: flag pulled" +2023,hidden,564,whib,2023-03-02,,,,"3/29: nest dry; 4/28: flag pulled" +2023,hidden,564,whib,2023-03-09,,,,"3/29: nest dry; 4/28: flag pulled" +2023,hidden,564,whib,2023-03-16,,,,"3/29: nest dry; 4/28: flag pulled" +2023,hidden,564,whib,2023-03-23,3,,incubating,"3/29: nest dry; 4/28: flag pulled" +2023,hidden,564,whib,2023-03-29,3,,incubating,"3/29: nest dry; 4/28: flag pulled" +2023,hidden,564,whib,2023-04-06,3,,incubating,"3/29: nest dry; 4/28: flag pulled" +2023,hidden,564,whib,2023-04-14,,3,nestling,"3/29: nest dry; 4/28: flag pulled" +2023,hidden,564,whib,2023-04-21,,1,nestling,"3/29: nest dry; 4/28: flag pulled" +2023,hidden,564,whib,2023-04-28,,,empty,"3/29: nest dry; 4/28: flag pulled" +2023,hidden,564,whib,2023-05-05,,,,"3/29: nest dry; 4/28: flag pulled" +2023,hidden,428,whib,2023-02-16,,,,"4/6: pulled flag" +2023,hidden,428,whib,2023-02-23,,,,"4/6: pulled flag" +2023,hidden,428,whib,2023-03-02,,,,"4/6: pulled flag" +2023,hidden,428,whib,2023-03-09,,,,"4/6: pulled flag" +2023,hidden,428,whib,2023-03-16,1,,incubating,"4/6: pulled flag" +2023,hidden,428,whib,2023-03-23,1,,incubating,"4/6: pulled flag" +2023,hidden,428,whib,2023-03-29,1,,incubating,"4/6: pulled flag" +2023,hidden,428,whib,2023-04-06,,,empty,"4/6: pulled flag" +2023,hidden,428,whib,2023-04-14,,,,"4/6: pulled flag" +2023,hidden,428,whib,2023-04-21,,,,"4/6: pulled flag" +2023,hidden,428,whib,2023-04-28,,,,"4/6: pulled flag" +2023,hidden,428,whib,2023-05-05,,,,"4/6: pulled flag" +2023,hidden,501,whib,2023-02-16,,,,"3/16: off to L of transect, next to 333 4/6:eggshells in nest, pulled flag" +2023,hidden,501,whib,2023-02-23,,,,"3/16: off to L of transect, next to 333 4/6:eggshells in nest, pulled flag" +2023,hidden,501,whib,2023-03-02,,,,"3/16: off to L of transect, next to 333 4/6:eggshells in nest, pulled flag" +2023,hidden,501,whib,2023-03-09,,,,"3/16: off to L of transect, next to 333 4/6:eggshells in nest, pulled flag" +2023,hidden,501,whib,2023-03-16,1,,incubating,"3/16: off to L of transect, next to 333 4/6:eggshells in nest, pulled flag" +2023,hidden,501,whib,2023-03-23,,,missed,"3/16: off to L of transect, next to 333 4/6:eggshells in nest, pulled flag" +2023,hidden,501,whib,2023-03-29,2,,incubating,"3/16: off to L of transect, next to 333 4/6:eggshells in nest, pulled flag" +2023,hidden,501,whib,2023-04-06,,,empty,"3/16: off to L of transect, next to 333 4/6:eggshells in nest, pulled flag" +2023,hidden,501,whib,2023-04-14,,,,"3/16: off to L of transect, next to 333 4/6:eggshells in nest, pulled flag" +2023,hidden,501,whib,2023-04-21,,,,"3/16: off to L of transect, next to 333 4/6:eggshells in nest, pulled flag" +2023,hidden,501,whib,2023-04-28,,,,"3/16: off to L of transect, next to 333 4/6:eggshells in nest, pulled flag" +2023,hidden,501,whib,2023-05-05,,,,"3/16: off to L of transect, next to 333 4/6:eggshells in nest, pulled flag" +2023,hidden,503,whib,2023-02-16,,,,"3/16: off to L of transect, next to 333 4/6: pulled flag" +2023,hidden,503,whib,2023-02-23,,,,"3/16: off to L of transect, next to 333 4/6: pulled flag" +2023,hidden,503,whib,2023-03-02,,,,"3/16: off to L of transect, next to 333 4/6: pulled flag" +2023,hidden,503,whib,2023-03-09,,,,"3/16: off to L of transect, next to 333 4/6: pulled flag" +2023,hidden,503,whib,2023-03-16,1,,incubating,"3/16: off to L of transect, next to 333 4/6: pulled flag" +2023,hidden,503,whib,2023-03-23,2,,incubating,"3/16: off to L of transect, next to 333 4/6: pulled flag" +2023,hidden,503,whib,2023-03-29,,,empty,"3/16: off to L of transect, next to 333 4/6: pulled flag" +2023,hidden,503,whib,2023-04-06,,,empty,"3/16: off to L of transect, next to 333 4/6: pulled flag" +2023,hidden,503,whib,2023-04-14,,,,"3/16: off to L of transect, next to 333 4/6: pulled flag" +2023,hidden,503,whib,2023-04-21,,,,"3/16: off to L of transect, next to 333 4/6: pulled flag" +2023,hidden,503,whib,2023-04-28,,,,"3/16: off to L of transect, next to 333 4/6: pulled flag" +2023,hidden,503,whib,2023-05-05,,,,"3/16: off to L of transect, next to 333 4/6: pulled flag" +2023,hidden,430,smhe,2023-02-16,,,,"4/21: flag pulled" +2023,hidden,430,smhe,2023-02-23,,,,"4/21: flag pulled" +2023,hidden,430,smhe,2023-03-02,,,,"4/21: flag pulled" +2023,hidden,430,smhe,2023-03-09,,,,"4/21: flag pulled" +2023,hidden,430,smhe,2023-03-16,2,,incubating,"4/21: flag pulled" +2023,hidden,430,smhe,2023-03-23,4,,incubating,"4/21: flag pulled" +2023,hidden,430,smhe,2023-03-29,4,,incubating,"4/21: flag pulled" +2023,hidden,430,smhe,2023-04-06,4,,incubating,"4/21: flag pulled" +2023,hidden,430,smhe,2023-04-14,,,empty,"4/21: flag pulled" +2023,hidden,430,smhe,2023-04-21,,,pulled,"4/21: flag pulled" +2023,hidden,430,smhe,2023-04-28,,,,"4/21: flag pulled" +2023,hidden,430,smhe,2023-05-05,,,,"4/21: flag pulled" +2023,hidden,432,smwh,2023-02-16,,,,"4/14: pulled flag" +2023,hidden,432,smwh,2023-02-23,,,,"4/14: pulled flag" +2023,hidden,432,smwh,2023-03-02,,,,"4/14: pulled flag" +2023,hidden,432,smwh,2023-03-09,,,,"4/14: pulled flag" +2023,hidden,432,smwh,2023-03-16,4,,incubating,"4/14: pulled flag" +2023,hidden,432,smwh,2023-03-23,4,,incubating,"4/14: pulled flag" +2023,hidden,432,smwh,2023-03-29,4,,incubating,"4/14: pulled flag" +2023,hidden,432,smwh,2023-04-06,1,3,hatching,"4/14: pulled flag" +2023,hidden,432,smwh,2023-04-14,,,empty,"4/14: pulled flag" +2023,hidden,432,smwh,2023-04-21,,,,"4/14: pulled flag" +2023,hidden,432,smwh,2023-04-28,,,,"4/14: pulled flag" +2023,hidden,432,smwh,2023-05-05,,,,"4/14: pulled flag" +2023,hidden,434,greg,2023-02-16,,,,"3/23: could be BCNH 3/29: pulled flag" +2023,hidden,434,greg,2023-02-23,,,,"3/23: could be BCNH 3/29: pulled flag" +2023,hidden,434,greg,2023-03-02,,,,"3/23: could be BCNH 3/29: pulled flag" +2023,hidden,434,greg,2023-03-09,,,,"3/23: could be BCNH 3/29: pulled flag" +2023,hidden,434,greg,2023-03-16,3,,incubating,"3/23: could be BCNH 3/29: pulled flag" +2023,hidden,434,greg,2023-03-23,3,,incubating,"3/23: could be BCNH 3/29: pulled flag" +2023,hidden,434,greg,2023-03-29,,,empty,"3/23: could be BCNH 3/29: pulled flag" +2023,hidden,434,greg,2023-04-06,,,,"3/23: could be BCNH 3/29: pulled flag" +2023,hidden,434,greg,2023-04-14,,,,"3/23: could be BCNH 3/29: pulled flag" +2023,hidden,434,greg,2023-04-21,,,,"3/23: could be BCNH 3/29: pulled flag" +2023,hidden,434,greg,2023-04-28,,,,"3/23: could be BCNH 3/29: pulled flag" +2023,hidden,434,greg,2023-05-05,,,,"3/23: could be BCNH 3/29: pulled flag" +2023,hidden,562,whib,2023-02-16,,,,"4/14: chicks dry; 4/21: 2 dead chicks. Flag pulled" +2023,hidden,562,whib,2023-02-23,,,,"4/14: chicks dry; 4/21: 2 dead chicks. Flag pulled" +2023,hidden,562,whib,2023-03-02,,,,"4/14: chicks dry; 4/21: 2 dead chicks. Flag pulled" +2023,hidden,562,whib,2023-03-09,,,,"4/14: chicks dry; 4/21: 2 dead chicks. Flag pulled" +2023,hidden,562,whib,2023-03-16,,,,"4/14: chicks dry; 4/21: 2 dead chicks. Flag pulled" +2023,hidden,562,whib,2023-03-23,2,,incubating,"4/14: chicks dry; 4/21: 2 dead chicks. Flag pulled" +2023,hidden,562,whib,2023-03-29,2,,incubating,"4/14: chicks dry; 4/21: 2 dead chicks. Flag pulled" +2023,hidden,562,whib,2023-04-06,2,,incubating,"4/14: chicks dry; 4/21: 2 dead chicks. Flag pulled" +2023,hidden,562,whib,2023-04-14,,2,chick_dry,"4/14: chicks dry; 4/21: 2 dead chicks. Flag pulled" +2023,hidden,562,whib,2023-04-21,,,empty,"4/14: chicks dry; 4/21: 2 dead chicks. Flag pulled" +2023,hidden,562,whib,2023-04-28,,,,"4/14: chicks dry; 4/21: 2 dead chicks. Flag pulled" +2023,hidden,562,whib,2023-05-05,,,,"4/14: chicks dry; 4/21: 2 dead chicks. Flag pulled" +2023,hidden,566,whib,2023-02-16,,,,"4/28: flag pulled" +2023,hidden,566,whib,2023-02-23,,,,"4/28: flag pulled" +2023,hidden,566,whib,2023-03-02,,,,"4/28: flag pulled" +2023,hidden,566,whib,2023-03-09,,,,"4/28: flag pulled" +2023,hidden,566,whib,2023-03-16,,,,"4/28: flag pulled" +2023,hidden,566,whib,2023-03-23,3,,incubating,"4/28: flag pulled" +2023,hidden,566,whib,2023-03-29,3,,incubating,"4/28: flag pulled" +2023,hidden,566,whib,2023-04-06,3,,incubating,"4/28: flag pulled" +2023,hidden,566,whib,2023-04-14,,2,nestling,"4/28: flag pulled" +2023,hidden,566,whib,2023-04-21,,1,nestling,"4/28: flag pulled" +2023,hidden,566,whib,2023-04-28,,,empty,"4/28: flag pulled" +2023,hidden,566,whib,2023-05-05,,,,"4/28: flag pulled" +2023,hidden,578,whib,2023-02-16,,,,"4/6: nest mostly gone, pulled flag" +2023,hidden,578,whib,2023-02-23,,,,"4/6: nest mostly gone, pulled flag" +2023,hidden,578,whib,2023-03-02,,,,"4/6: nest mostly gone, pulled flag" +2023,hidden,578,whib,2023-03-09,,,,"4/6: nest mostly gone, pulled flag" +2023,hidden,578,whib,2023-03-16,,,,"4/6: nest mostly gone, pulled flag" +2023,hidden,578,whib,2023-03-23,2,,incubating,"4/6: nest mostly gone, pulled flag" +2023,hidden,578,whib,2023-03-29,,,empty,"4/6: nest mostly gone, pulled flag" +2023,hidden,578,whib,2023-04-06,,,pulled,"4/6: nest mostly gone, pulled flag" +2023,hidden,578,whib,2023-04-14,,,,"4/6: nest mostly gone, pulled flag" +2023,hidden,578,whib,2023-04-21,,,,"4/6: nest mostly gone, pulled flag" +2023,hidden,578,whib,2023-04-28,,,,"4/6: nest mostly gone, pulled flag" +2023,hidden,578,whib,2023-05-05,,,,"4/6: nest mostly gone, pulled flag" +2023,hidden,580,whib,2023-02-16,,,,"4/28: flag pulled" +2023,hidden,580,whib,2023-02-23,,,,"4/28: flag pulled" +2023,hidden,580,whib,2023-03-02,,,,"4/28: flag pulled" +2023,hidden,580,whib,2023-03-09,,,,"4/28: flag pulled" +2023,hidden,580,whib,2023-03-16,,,,"4/28: flag pulled" +2023,hidden,580,whib,2023-03-23,2,,incubating,"4/28: flag pulled" +2023,hidden,580,whib,2023-03-29,2,,incubating,"4/28: flag pulled" +2023,hidden,580,whib,2023-04-06,2,,incubating,"4/28: flag pulled" +2023,hidden,580,whib,2023-04-14,,2,nestling,"4/28: flag pulled" +2023,hidden,580,whib,2023-04-21,,2,nestling,"4/28: flag pulled" +2023,hidden,580,whib,2023-04-28,,,empty,"4/28: flag pulled" +2023,hidden,580,whib,2023-05-05,,,,"4/28: flag pulled" +2023,hidden,570,whib,2023-02-16,,,,"4/14: broken eggs in nest" +2023,hidden,570,whib,2023-02-23,,,,"4/14: broken eggs in nest" +2023,hidden,570,whib,2023-03-02,,,,"4/14: broken eggs in nest" +2023,hidden,570,whib,2023-03-09,,,,"4/14: broken eggs in nest" +2023,hidden,570,whib,2023-03-16,,,,"4/14: broken eggs in nest" +2023,hidden,570,whib,2023-03-23,3,,incubating,"4/14: broken eggs in nest" +2023,hidden,570,whib,2023-03-29,3,,incubating,"4/14: broken eggs in nest" +2023,hidden,570,whib,2023-04-06,3,,incubating,"4/14: broken eggs in nest" +2023,hidden,570,whib,2023-04-14,,,empty,"4/14: broken eggs in nest" +2023,hidden,570,whib,2023-04-21,,,empty,"4/14: broken eggs in nest" +2023,hidden,570,whib,2023-04-28,,,pulled,"4/14: broken eggs in nest" +2023,hidden,570,whib,2023-05-05,,,,"4/14: broken eggs in nest" +2023,hidden,574,whib,2023-02-16,,,, +2023,hidden,574,whib,2023-02-23,,,, +2023,hidden,574,whib,2023-03-02,,,, +2023,hidden,574,whib,2023-03-09,,,, +2023,hidden,574,whib,2023-03-16,,,, +2023,hidden,574,whib,2023-03-23,3,,incubating, +2023,hidden,574,whib,2023-03-29,3,,incubating, +2023,hidden,574,whib,2023-04-06,3,,incubating, +2023,hidden,574,whib,2023-04-14,,1,nestling, +2023,hidden,574,whib,2023-04-21,,,empty, +2023,hidden,574,whib,2023-04-28,,,pulled, +2023,hidden,574,whib,2023-05-05,,,, +2023,hidden,572,whib,2023-02-16,,,,"3/29: hard to see into the nest, egg deep in nest 4/6: nest partially gone, pulled flag" +2023,hidden,572,whib,2023-02-23,,,,"3/29: hard to see into the nest, egg deep in nest 4/6: nest partially gone, pulled flag" +2023,hidden,572,whib,2023-03-02,,,,"3/29: hard to see into the nest, egg deep in nest 4/6: nest partially gone, pulled flag" +2023,hidden,572,whib,2023-03-09,,,,"3/29: hard to see into the nest, egg deep in nest 4/6: nest partially gone, pulled flag" +2023,hidden,572,whib,2023-03-16,,,,"3/29: hard to see into the nest, egg deep in nest 4/6: nest partially gone, pulled flag" +2023,hidden,572,whib,2023-03-23,2,,incubating,"3/29: hard to see into the nest, egg deep in nest 4/6: nest partially gone, pulled flag" +2023,hidden,572,whib,2023-03-29,1,,incubating,"3/29: hard to see into the nest, egg deep in nest 4/6: nest partially gone, pulled flag" +2023,hidden,572,whib,2023-04-06,,,empty,"3/29: hard to see into the nest, egg deep in nest 4/6: nest partially gone, pulled flag" +2023,hidden,572,whib,2023-04-14,,,,"3/29: hard to see into the nest, egg deep in nest 4/6: nest partially gone, pulled flag" +2023,hidden,572,whib,2023-04-21,,,,"3/29: hard to see into the nest, egg deep in nest 4/6: nest partially gone, pulled flag" +2023,hidden,572,whib,2023-04-28,,,,"3/29: hard to see into the nest, egg deep in nest 4/6: nest partially gone, pulled flag" +2023,hidden,572,whib,2023-05-05,,,,"3/29: hard to see into the nest, egg deep in nest 4/6: nest partially gone, pulled flag" +2023,hidden,576,whib,2023-02-16,,,,"3/29: skipped due to alligator; 4/28: flag pulled" +2023,hidden,576,whib,2023-02-23,,,,"3/29: skipped due to alligator; 4/28: flag pulled" +2023,hidden,576,whib,2023-03-02,,,,"3/29: skipped due to alligator; 4/28: flag pulled" +2023,hidden,576,whib,2023-03-09,,,,"3/29: skipped due to alligator; 4/28: flag pulled" +2023,hidden,576,whib,2023-03-16,,,,"3/29: skipped due to alligator; 4/28: flag pulled" +2023,hidden,576,whib,2023-03-23,3,,incubating,"3/29: skipped due to alligator; 4/28: flag pulled" +2023,hidden,576,whib,2023-03-29,,,missed,"3/29: skipped due to alligator; 4/28: flag pulled" +2023,hidden,576,whib,2023-04-06,3,,incubating,"3/29: skipped due to alligator; 4/28: flag pulled" +2023,hidden,576,whib,2023-04-14,,3,nestling,"3/29: skipped due to alligator; 4/28: flag pulled" +2023,hidden,576,whib,2023-04-21,,1,nestling,"3/29: skipped due to alligator; 4/28: flag pulled" +2023,hidden,576,whib,2023-04-28,,,empty,"3/29: skipped due to alligator; 4/28: flag pulled" +2023,hidden,576,whib,2023-05-05,,,,"3/29: skipped due to alligator; 4/28: flag pulled" +2023,hidden,568,whib,2023-02-16,,,,"3/29: egg buried in nest" +2023,hidden,568,whib,2023-02-23,,,,"3/29: egg buried in nest" +2023,hidden,568,whib,2023-03-02,,,,"3/29: egg buried in nest" +2023,hidden,568,whib,2023-03-09,,,,"3/29: egg buried in nest" +2023,hidden,568,whib,2023-03-16,1,,incubating,"3/29: egg buried in nest" +2023,hidden,568,whib,2023-03-23,1,,incubating,"3/29: egg buried in nest" +2023,hidden,568,whib,2023-03-29,1,,incubating,"3/29: egg buried in nest" +2023,hidden,568,whib,2023-04-06,1,,incubating,"3/29: egg buried in nest" +2023,hidden,568,whib,2023-04-14,,,empty,"3/29: egg buried in nest" +2023,hidden,568,whib,2023-04-21,,,empty,"3/29: egg buried in nest" +2023,hidden,568,whib,2023-04-28,,,pulled,"3/29: egg buried in nest" +2023,hidden,568,whib,2023-05-05,,,,"3/29: egg buried in nest" +2023,hidden,582,whib,2023-02-16,,,,"4/6: pulled flag" +2023,hidden,582,whib,2023-02-23,,,,"4/6: pulled flag" +2023,hidden,582,whib,2023-03-02,,,,"4/6: pulled flag" +2023,hidden,582,whib,2023-03-09,,,,"4/6: pulled flag" +2023,hidden,582,whib,2023-03-16,1,,incubating,"4/6: pulled flag" +2023,hidden,582,whib,2023-03-23,2,,incubating,"4/6: pulled flag" +2023,hidden,582,whib,2023-03-29,,,empty,"4/6: pulled flag" +2023,hidden,582,whib,2023-04-06,,,pulled,"4/6: pulled flag" +2023,hidden,582,whib,2023-04-14,,,,"4/6: pulled flag" +2023,hidden,582,whib,2023-04-21,,,,"4/6: pulled flag" +2023,hidden,582,whib,2023-04-28,,,,"4/6: pulled flag" +2023,hidden,582,whib,2023-05-05,,,,"4/6: pulled flag" +2023,hidden,563,whib,2023-02-16,,,,"3/29: 1 egg buried in nest 4/6: pulled flag" +2023,hidden,563,whib,2023-02-23,,,,"3/29: 1 egg buried in nest 4/6: pulled flag" +2023,hidden,563,whib,2023-03-02,,,,"3/29: 1 egg buried in nest 4/6: pulled flag" +2023,hidden,563,whib,2023-03-09,,,,"3/29: 1 egg buried in nest 4/6: pulled flag" +2023,hidden,563,whib,2023-03-16,,,,"3/29: 1 egg buried in nest 4/6: pulled flag" +2023,hidden,563,whib,2023-03-23,2,,incubating,"3/29: 1 egg buried in nest 4/6: pulled flag" +2023,hidden,563,whib,2023-03-29,1,,incubating,"3/29: 1 egg buried in nest 4/6: pulled flag" +2023,hidden,563,whib,2023-04-06,,,empty,"3/29: 1 egg buried in nest 4/6: pulled flag" +2023,hidden,563,whib,2023-04-14,,,,"3/29: 1 egg buried in nest 4/6: pulled flag" +2023,hidden,563,whib,2023-04-21,,,,"3/29: 1 egg buried in nest 4/6: pulled flag" +2023,hidden,563,whib,2023-04-28,,,,"3/29: 1 egg buried in nest 4/6: pulled flag" +2023,hidden,563,whib,2023-05-05,,,,"3/29: 1 egg buried in nest 4/6: pulled flag" +2023,hidden,565,whib,2023-02-16,,,,"3/29: 1 egg buried in nest 4/6: pulled flag" +2023,hidden,565,whib,2023-02-23,,,,"3/29: 1 egg buried in nest 4/6: pulled flag" +2023,hidden,565,whib,2023-03-02,,,,"3/29: 1 egg buried in nest 4/6: pulled flag" +2023,hidden,565,whib,2023-03-09,,,,"3/29: 1 egg buried in nest 4/6: pulled flag" +2023,hidden,565,whib,2023-03-16,1,,incubating,"3/29: 1 egg buried in nest 4/6: pulled flag" +2023,hidden,565,whib,2023-03-23,2,,incubating,"3/29: 1 egg buried in nest 4/6: pulled flag" +2023,hidden,565,whib,2023-03-29,1,,incubating,"3/29: 1 egg buried in nest 4/6: pulled flag" +2023,hidden,565,whib,2023-04-06,,,empty,"3/29: 1 egg buried in nest 4/6: pulled flag" +2023,hidden,565,whib,2023-04-14,,,,"3/29: 1 egg buried in nest 4/6: pulled flag" +2023,hidden,565,whib,2023-04-21,,,,"3/29: 1 egg buried in nest 4/6: pulled flag" +2023,hidden,565,whib,2023-04-28,,,,"3/29: 1 egg buried in nest 4/6: pulled flag" +2023,hidden,565,whib,2023-05-05,,,,"3/29: 1 egg buried in nest 4/6: pulled flag" +2023,hidden,567,whib,2023-02-16,,,,"4/14: bigger chick 5/5:pretty sure chicks did not fledge, fresh dead chick nearby" +2023,hidden,567,whib,2023-02-23,,,,"4/14: bigger chick 5/5:pretty sure chicks did not fledge, fresh dead chick nearby" +2023,hidden,567,whib,2023-03-02,,,,"4/14: bigger chick 5/5:pretty sure chicks did not fledge, fresh dead chick nearby" +2023,hidden,567,whib,2023-03-09,,,,"4/14: bigger chick 5/5:pretty sure chicks did not fledge, fresh dead chick nearby" +2023,hidden,567,whib,2023-03-16,1,,incubating,"4/14: bigger chick 5/5:pretty sure chicks did not fledge, fresh dead chick nearby" +2023,hidden,567,whib,2023-03-23,2,,incubating,"4/14: bigger chick 5/5:pretty sure chicks did not fledge, fresh dead chick nearby" +2023,hidden,567,whib,2023-03-29,2,,incubating,"4/14: bigger chick 5/5:pretty sure chicks did not fledge, fresh dead chick nearby" +2023,hidden,567,whib,2023-04-06,2,,incubating,"4/14: bigger chick 5/5:pretty sure chicks did not fledge, fresh dead chick nearby" +2023,hidden,567,whib,2023-04-14,1,1,hatching,"4/14: bigger chick 5/5:pretty sure chicks did not fledge, fresh dead chick nearby" +2023,hidden,567,whib,2023-04-21,,1,nestling,"4/14: bigger chick 5/5:pretty sure chicks did not fledge, fresh dead chick nearby" +2023,hidden,567,whib,2023-04-28,,2,nestling,"4/14: bigger chick 5/5:pretty sure chicks did not fledge, fresh dead chick nearby" +2023,hidden,567,whib,2023-05-05,,,empty,"4/14: bigger chick 5/5:pretty sure chicks did not fledge, fresh dead chick nearby" +2023,hidden,569,whib,2023-02-16,,,,"4/6: pulled flag" +2023,hidden,569,whib,2023-02-23,,,,"4/6: pulled flag" +2023,hidden,569,whib,2023-03-02,,,,"4/6: pulled flag" +2023,hidden,569,whib,2023-03-09,,,,"4/6: pulled flag" +2023,hidden,569,whib,2023-03-16,,,,"4/6: pulled flag" +2023,hidden,569,whib,2023-03-23,2,,incubating,"4/6: pulled flag" +2023,hidden,569,whib,2023-03-29,1,,incubating,"4/6: pulled flag" +2023,hidden,569,whib,2023-04-06,,,empty,"4/6: pulled flag" +2023,hidden,569,whib,2023-04-14,,,,"4/6: pulled flag" +2023,hidden,569,whib,2023-04-21,,,,"4/6: pulled flag" +2023,hidden,569,whib,2023-04-28,,,,"4/6: pulled flag" +2023,hidden,569,whib,2023-05-05,,,,"4/6: pulled flag" +2023,hidden,559,whib,2023-02-16,,,,"3/23: by 428; 4/21: flag pulled" +2023,hidden,559,whib,2023-02-23,,,,"3/23: by 428; 4/21: flag pulled" +2023,hidden,559,whib,2023-03-02,,,,"3/23: by 428; 4/21: flag pulled" +2023,hidden,559,whib,2023-03-09,,,,"3/23: by 428; 4/21: flag pulled" +2023,hidden,559,whib,2023-03-16,1,,incubating,"3/23: by 428; 4/21: flag pulled" +2023,hidden,559,whib,2023-03-23,2,,incubating,"3/23: by 428; 4/21: flag pulled" +2023,hidden,559,whib,2023-03-29,2,,incubating,"3/23: by 428; 4/21: flag pulled" +2023,hidden,559,whib,2023-04-06,2,,incubating,"3/23: by 428; 4/21: flag pulled" +2023,hidden,559,whib,2023-04-14,,2,nestling,"3/23: by 428; 4/21: flag pulled" +2023,hidden,559,whib,2023-04-21,,,empty,"3/23: by 428; 4/21: flag pulled" +2023,hidden,559,whib,2023-04-28,,,,"3/23: by 428; 4/21: flag pulled" +2023,hidden,559,whib,2023-05-05,,,,"3/23: by 428; 4/21: flag pulled" +2023,hidden,561,whib,2023-02-16,,,,"4/6: pulled flag" +2023,hidden,561,whib,2023-02-23,,,,"4/6: pulled flag" +2023,hidden,561,whib,2023-03-02,,,,"4/6: pulled flag" +2023,hidden,561,whib,2023-03-09,,,,"4/6: pulled flag" +2023,hidden,561,whib,2023-03-16,1,,incubating,"4/6: pulled flag" +2023,hidden,561,whib,2023-03-23,2,,incubating,"4/6: pulled flag" +2023,hidden,561,whib,2023-03-29,2,,incubating,"4/6: pulled flag" +2023,hidden,561,whib,2023-04-06,,,empty,"4/6: pulled flag" +2023,hidden,561,whib,2023-04-14,,,,"4/6: pulled flag" +2023,hidden,561,whib,2023-04-21,,,,"4/6: pulled flag" +2023,hidden,561,whib,2023-04-28,,,,"4/6: pulled flag" +2023,hidden,561,whib,2023-05-05,,,,"4/6: pulled flag" +2023,hidden,571,whib,2023-02-16,,,,"3/29: one broken egg in nest, very developed 4/6: pulled flag" +2023,hidden,571,whib,2023-02-23,,,,"3/29: one broken egg in nest, very developed 4/6: pulled flag" +2023,hidden,571,whib,2023-03-02,,,,"3/29: one broken egg in nest, very developed 4/6: pulled flag" +2023,hidden,571,whib,2023-03-09,,,,"3/29: one broken egg in nest, very developed 4/6: pulled flag" +2023,hidden,571,whib,2023-03-16,,,,"3/29: one broken egg in nest, very developed 4/6: pulled flag" +2023,hidden,571,whib,2023-03-23,1,,incubating,"3/29: one broken egg in nest, very developed 4/6: pulled flag" +2023,hidden,571,whib,2023-03-29,,,empty,"3/29: one broken egg in nest, very developed 4/6: pulled flag" +2023,hidden,571,whib,2023-04-06,,,pulled,"3/29: one broken egg in nest, very developed 4/6: pulled flag" +2023,hidden,571,whib,2023-04-14,,,,"3/29: one broken egg in nest, very developed 4/6: pulled flag" +2023,hidden,571,whib,2023-04-21,,,,"3/29: one broken egg in nest, very developed 4/6: pulled flag" +2023,hidden,571,whib,2023-04-28,,,,"3/29: one broken egg in nest, very developed 4/6: pulled flag" +2023,hidden,571,whib,2023-05-05,,,,"3/29: one broken egg in nest, very developed 4/6: pulled flag" +2023,hidden,573,whib,2023-02-16,,,,"3/29: nest gone, flag pulled" +2023,hidden,573,whib,2023-02-23,,,,"3/29: nest gone, flag pulled" +2023,hidden,573,whib,2023-03-02,,,,"3/29: nest gone, flag pulled" +2023,hidden,573,whib,2023-03-09,,,,"3/29: nest gone, flag pulled" +2023,hidden,573,whib,2023-03-16,,,,"3/29: nest gone, flag pulled" +2023,hidden,573,whib,2023-03-23,1,,incubating,"3/29: nest gone, flag pulled" +2023,hidden,573,whib,2023-03-29,,,empty,"3/29: nest gone, flag pulled" +2023,hidden,573,whib,2023-04-06,,,,"3/29: nest gone, flag pulled" +2023,hidden,573,whib,2023-04-14,,,,"3/29: nest gone, flag pulled" +2023,hidden,573,whib,2023-04-21,,,,"3/29: nest gone, flag pulled" +2023,hidden,573,whib,2023-04-28,,,,"3/29: nest gone, flag pulled" +2023,hidden,573,whib,2023-05-05,,,,"3/29: nest gone, flag pulled" +2023,hidden,584,whib,2023-02-16,,,,"4/6: pulled flag" +2023,hidden,584,whib,2023-02-23,,,,"4/6: pulled flag" +2023,hidden,584,whib,2023-03-02,,,,"4/6: pulled flag" +2023,hidden,584,whib,2023-03-09,,,,"4/6: pulled flag" +2023,hidden,584,whib,2023-03-16,1,,incubating,"4/6: pulled flag" +2023,hidden,584,whib,2023-03-23,3,,incubating,"4/6: pulled flag" +2023,hidden,584,whib,2023-03-29,3,,incubating,"4/6: pulled flag" +2023,hidden,584,whib,2023-04-06,,,empty,"4/6: pulled flag" +2023,hidden,584,whib,2023-04-14,,,,"4/6: pulled flag" +2023,hidden,584,whib,2023-04-21,,,,"4/6: pulled flag" +2023,hidden,584,whib,2023-04-28,,,,"4/6: pulled flag" +2023,hidden,584,whib,2023-05-05,,,,"4/6: pulled flag" +2023,hidden,586,whib,2023-02-16,,,,"4/6: pulled flag" +2023,hidden,586,whib,2023-02-23,,,,"4/6: pulled flag" +2023,hidden,586,whib,2023-03-02,,,,"4/6: pulled flag" +2023,hidden,586,whib,2023-03-09,,,,"4/6: pulled flag" +2023,hidden,586,whib,2023-03-16,1,,incubating,"4/6: pulled flag" +2023,hidden,586,whib,2023-03-23,3,,incubating,"4/6: pulled flag" +2023,hidden,586,whib,2023-03-29,3,,incubating,"4/6: pulled flag" +2023,hidden,586,whib,2023-04-06,,,empty,"4/6: pulled flag" +2023,hidden,586,whib,2023-04-14,,,,"4/6: pulled flag" +2023,hidden,586,whib,2023-04-21,,,,"4/6: pulled flag" +2023,hidden,586,whib,2023-04-28,,,,"4/6: pulled flag" +2023,hidden,586,whib,2023-05-05,,,,"4/6: pulled flag" +2023,hidden,592,whib,2023-02-16,,,,"4/6: eggshells in nest, pulled flag" +2023,hidden,592,whib,2023-02-23,,,,"4/6: eggshells in nest, pulled flag" +2023,hidden,592,whib,2023-03-02,,,,"4/6: eggshells in nest, pulled flag" +2023,hidden,592,whib,2023-03-09,,,,"4/6: eggshells in nest, pulled flag" +2023,hidden,592,whib,2023-03-16,1,,incubating,"4/6: eggshells in nest, pulled flag" +2023,hidden,592,whib,2023-03-23,2,,incubating,"4/6: eggshells in nest, pulled flag" +2023,hidden,592,whib,2023-03-29,2,,incubating,"4/6: eggshells in nest, pulled flag" +2023,hidden,592,whib,2023-04-06,,,empty,"4/6: eggshells in nest, pulled flag" +2023,hidden,592,whib,2023-04-14,,,,"4/6: eggshells in nest, pulled flag" +2023,hidden,592,whib,2023-04-21,,,,"4/6: eggshells in nest, pulled flag" +2023,hidden,592,whib,2023-04-28,,,,"4/6: eggshells in nest, pulled flag" +2023,hidden,592,whib,2023-05-05,,,,"4/6: eggshells in nest, pulled flag" +2023,hidden,588,whib,2023-02-16,,,,"4/14: pulled flag" +2023,hidden,588,whib,2023-02-23,,,,"4/14: pulled flag" +2023,hidden,588,whib,2023-03-02,,,,"4/14: pulled flag" +2023,hidden,588,whib,2023-03-09,,,,"4/14: pulled flag" +2023,hidden,588,whib,2023-03-16,,,,"4/14: pulled flag" +2023,hidden,588,whib,2023-03-23,2,,incubating,"4/14: pulled flag" +2023,hidden,588,whib,2023-03-29,2,,incubating,"4/14: pulled flag" +2023,hidden,588,whib,2023-04-06,1,,incubating,"4/14: pulled flag" +2023,hidden,588,whib,2023-04-14,,,empty,"4/14: pulled flag" +2023,hidden,588,whib,2023-04-21,,,,"4/14: pulled flag" +2023,hidden,588,whib,2023-04-28,,,,"4/14: pulled flag" +2023,hidden,588,whib,2023-05-05,,,,"4/14: pulled flag" +2023,hidden,590,whib,2023-02-16,,,,"4/6: eggshells in nest, pulled flag" +2023,hidden,590,whib,2023-02-23,,,,"4/6: eggshells in nest, pulled flag" +2023,hidden,590,whib,2023-03-02,,,,"4/6: eggshells in nest, pulled flag" +2023,hidden,590,whib,2023-03-09,,,,"4/6: eggshells in nest, pulled flag" +2023,hidden,590,whib,2023-03-16,,,,"4/6: eggshells in nest, pulled flag" +2023,hidden,590,whib,2023-03-23,2,,incubating,"4/6: eggshells in nest, pulled flag" +2023,hidden,590,whib,2023-03-29,2,,incubating,"4/6: eggshells in nest, pulled flag" +2023,hidden,590,whib,2023-04-06,,,empty,"4/6: eggshells in nest, pulled flag" +2023,hidden,590,whib,2023-04-14,,,,"4/6: eggshells in nest, pulled flag" +2023,hidden,590,whib,2023-04-21,,,,"4/6: eggshells in nest, pulled flag" +2023,hidden,590,whib,2023-04-28,,,,"4/6: eggshells in nest, pulled flag" +2023,hidden,590,whib,2023-05-05,,,,"4/6: eggshells in nest, pulled flag" +2023,hidden,594,whib,2023-02-16,,,,"4/6: pulled flag" +2023,hidden,594,whib,2023-02-23,,,,"4/6: pulled flag" +2023,hidden,594,whib,2023-03-02,,,,"4/6: pulled flag" +2023,hidden,594,whib,2023-03-09,,,,"4/6: pulled flag" +2023,hidden,594,whib,2023-03-16,,,,"4/6: pulled flag" +2023,hidden,594,whib,2023-03-23,2,,incubating,"4/6: pulled flag" +2023,hidden,594,whib,2023-03-29,2,,incubating,"4/6: pulled flag" +2023,hidden,594,whib,2023-04-06,,,empty,"4/6: pulled flag" +2023,hidden,594,whib,2023-04-14,,,,"4/6: pulled flag" +2023,hidden,594,whib,2023-04-21,,,,"4/6: pulled flag" +2023,hidden,594,whib,2023-04-28,,,,"4/6: pulled flag" +2023,hidden,594,whib,2023-05-05,,,,"4/6: pulled flag" +2023,hidden,596,whib,2023-02-16,,,,"3/29: by 133 4/14: 2 dead chicks in nest" +2023,hidden,596,whib,2023-02-23,,,,"3/29: by 133 4/14: 2 dead chicks in nest" +2023,hidden,596,whib,2023-03-02,,,,"3/29: by 133 4/14: 2 dead chicks in nest" +2023,hidden,596,whib,2023-03-09,,,,"3/29: by 133 4/14: 2 dead chicks in nest" +2023,hidden,596,whib,2023-03-16,,,,"3/29: by 133 4/14: 2 dead chicks in nest" +2023,hidden,596,whib,2023-03-23,3,,incubating,"3/29: by 133 4/14: 2 dead chicks in nest" +2023,hidden,596,whib,2023-03-29,3,,incubating,"3/29: by 133 4/14: 2 dead chicks in nest" +2023,hidden,596,whib,2023-04-06,3,,incubating,"3/29: by 133 4/14: 2 dead chicks in nest" +2023,hidden,596,whib,2023-04-14,,1,nestling,"3/29: by 133 4/14: 2 dead chicks in nest" +2023,hidden,596,whib,2023-04-21,,,empty,"3/29: by 133 4/14: 2 dead chicks in nest" +2023,hidden,596,whib,2023-04-28,,,pulled,"3/29: by 133 4/14: 2 dead chicks in nest" +2023,hidden,596,whib,2023-05-05,,,,"3/29: by 133 4/14: 2 dead chicks in nest" +2023,hidden,598,whib,2023-02-16,,,,"4/6: pulled flag" +2023,hidden,598,whib,2023-02-23,,,,"4/6: pulled flag" +2023,hidden,598,whib,2023-03-02,,,,"4/6: pulled flag" +2023,hidden,598,whib,2023-03-09,,,,"4/6: pulled flag" +2023,hidden,598,whib,2023-03-16,,,,"4/6: pulled flag" +2023,hidden,598,whib,2023-03-23,2,,incubating,"4/6: pulled flag" +2023,hidden,598,whib,2023-03-29,2,,incubating,"4/6: pulled flag" +2023,hidden,598,whib,2023-04-06,,,empty,"4/6: pulled flag" +2023,hidden,598,whib,2023-04-14,,,,"4/6: pulled flag" +2023,hidden,598,whib,2023-04-21,,,,"4/6: pulled flag" +2023,hidden,598,whib,2023-04-28,,,,"4/6: pulled flag" +2023,hidden,598,whib,2023-05-05,,,,"4/6: pulled flag" +2023,hidden,600,whib,2023-02-16,,,, +2023,hidden,600,whib,2023-02-23,,,, +2023,hidden,600,whib,2023-03-02,,,, +2023,hidden,600,whib,2023-03-09,,,, +2023,hidden,600,whib,2023-03-16,,,, +2023,hidden,600,whib,2023-03-23,1,,incubating, +2023,hidden,600,whib,2023-03-29,2,,incubating, +2023,hidden,600,whib,2023-04-06,,,missed, +2023,hidden,600,whib,2023-04-14,,,missed, +2023,hidden,600,whib,2023-04-21,,,missed, +2023,hidden,600,whib,2023-04-28,,,missed, +2023,hidden,600,whib,2023-05-05,,,, +2023,hidden,611,whib,2023-02-16,,,,"4/6: pulled flag" +2023,hidden,611,whib,2023-02-23,,,,"4/6: pulled flag" +2023,hidden,611,whib,2023-03-02,,,,"4/6: pulled flag" +2023,hidden,611,whib,2023-03-09,,,,"4/6: pulled flag" +2023,hidden,611,whib,2023-03-16,,,,"4/6: pulled flag" +2023,hidden,611,whib,2023-03-23,,,,"4/6: pulled flag" +2023,hidden,611,whib,2023-03-29,2,,incubating,"4/6: pulled flag" +2023,hidden,611,whib,2023-04-06,,,empty,"4/6: pulled flag" +2023,hidden,611,whib,2023-04-14,,,,"4/6: pulled flag" +2023,hidden,611,whib,2023-04-21,,,,"4/6: pulled flag" +2023,hidden,611,whib,2023-04-28,,,,"4/6: pulled flag" +2023,hidden,611,whib,2023-05-05,,,,"4/6: pulled flag" +2023,hidden,613,whib,2023-02-16,,,,"4/6: pulled flag" +2023,hidden,613,whib,2023-02-23,,,,"4/6: pulled flag" +2023,hidden,613,whib,2023-03-02,,,,"4/6: pulled flag" +2023,hidden,613,whib,2023-03-09,,,,"4/6: pulled flag" +2023,hidden,613,whib,2023-03-16,,,,"4/6: pulled flag" +2023,hidden,613,whib,2023-03-23,,,,"4/6: pulled flag" +2023,hidden,613,whib,2023-03-29,2,,incubating,"4/6: pulled flag" +2023,hidden,613,whib,2023-04-06,,,empty,"4/6: pulled flag" +2023,hidden,613,whib,2023-04-14,,,,"4/6: pulled flag" +2023,hidden,613,whib,2023-04-21,,,,"4/6: pulled flag" +2023,hidden,613,whib,2023-04-28,,,,"4/6: pulled flag" +2023,hidden,613,whib,2023-05-05,,,,"4/6: pulled flag" +2023,hidden,614,whib,2023-02-16,,,,"4/28: flag pulled" +2023,hidden,614,whib,2023-02-23,,,,"4/28: flag pulled" +2023,hidden,614,whib,2023-03-02,,,,"4/28: flag pulled" +2023,hidden,614,whib,2023-03-09,,,,"4/28: flag pulled" +2023,hidden,614,whib,2023-03-16,,,,"4/28: flag pulled" +2023,hidden,614,whib,2023-03-23,,,,"4/28: flag pulled" +2023,hidden,614,whib,2023-03-29,2,,incubating,"4/28: flag pulled" +2023,hidden,614,whib,2023-04-06,2,,incubating,"4/28: flag pulled" +2023,hidden,614,whib,2023-04-14,1,1,hatching,"4/28: flag pulled" +2023,hidden,614,whib,2023-04-21,,2,nestling,"4/28: flag pulled" +2023,hidden,614,whib,2023-04-28,,,empty,"4/28: flag pulled" +2023,hidden,614,whib,2023-05-05,,,,"4/28: flag pulled" +2023,hidden,616,whib,2023-02-16,,,,"4/14: broken eggs in nest" +2023,hidden,616,whib,2023-02-23,,,,"4/14: broken eggs in nest" +2023,hidden,616,whib,2023-03-02,,,,"4/14: broken eggs in nest" +2023,hidden,616,whib,2023-03-09,,,,"4/14: broken eggs in nest" +2023,hidden,616,whib,2023-03-16,,,,"4/14: broken eggs in nest" +2023,hidden,616,whib,2023-03-23,,,,"4/14: broken eggs in nest" +2023,hidden,616,whib,2023-03-29,2,,incubating,"4/14: broken eggs in nest" +2023,hidden,616,whib,2023-04-06,1,,incubating,"4/14: broken eggs in nest" +2023,hidden,616,whib,2023-04-14,,,empty,"4/14: broken eggs in nest" +2023,hidden,616,whib,2023-04-21,,,pulled,"4/14: broken eggs in nest" +2023,hidden,616,whib,2023-04-28,,,,"4/14: broken eggs in nest" +2023,hidden,616,whib,2023-05-05,,,,"4/14: broken eggs in nest" +2023,hidden,618,whib,2023-02-16,,,,"4/6: egg a little buried in nest 4/14: nest gone, pulled flag" +2023,hidden,618,whib,2023-02-23,,,,"4/6: egg a little buried in nest 4/14: nest gone, pulled flag" +2023,hidden,618,whib,2023-03-02,,,,"4/6: egg a little buried in nest 4/14: nest gone, pulled flag" +2023,hidden,618,whib,2023-03-09,,,,"4/6: egg a little buried in nest 4/14: nest gone, pulled flag" +2023,hidden,618,whib,2023-03-16,,,,"4/6: egg a little buried in nest 4/14: nest gone, pulled flag" +2023,hidden,618,whib,2023-03-23,,,,"4/6: egg a little buried in nest 4/14: nest gone, pulled flag" +2023,hidden,618,whib,2023-03-29,2,,incubating,"4/6: egg a little buried in nest 4/14: nest gone, pulled flag" +2023,hidden,618,whib,2023-04-06,1,,incubating,"4/6: egg a little buried in nest 4/14: nest gone, pulled flag" +2023,hidden,618,whib,2023-04-14,,,empty,"4/6: egg a little buried in nest 4/14: nest gone, pulled flag" +2023,hidden,618,whib,2023-04-21,,,pulled,"4/6: egg a little buried in nest 4/14: nest gone, pulled flag" +2023,hidden,618,whib,2023-04-28,,,,"4/6: egg a little buried in nest 4/14: nest gone, pulled flag" +2023,hidden,618,whib,2023-05-05,,,,"4/6: egg a little buried in nest 4/14: nest gone, pulled flag" +2023,hidden,620,whib,2023-02-16,,,, +2023,hidden,620,whib,2023-02-23,,,, +2023,hidden,620,whib,2023-03-02,,,, +2023,hidden,620,whib,2023-03-09,,,, +2023,hidden,620,whib,2023-03-16,,,, +2023,hidden,620,whib,2023-03-23,,,, +2023,hidden,620,whib,2023-03-29,1,,incubating, +2023,hidden,620,whib,2023-04-06,1,,incubating, +2023,hidden,620,whib,2023-04-14,,,empty, +2023,hidden,620,whib,2023-04-21,,,pulled, +2023,hidden,620,whib,2023-04-28,,,, +2023,hidden,620,whib,2023-05-05,,,, +2023,hidden,622,whib,2023-02-16,,,,"4/28: flag pulled" +2023,hidden,622,whib,2023-02-23,,,,"4/28: flag pulled" +2023,hidden,622,whib,2023-03-02,,,,"4/28: flag pulled" +2023,hidden,622,whib,2023-03-09,,,,"4/28: flag pulled" +2023,hidden,622,whib,2023-03-16,,,,"4/28: flag pulled" +2023,hidden,622,whib,2023-03-23,,,,"4/28: flag pulled" +2023,hidden,622,whib,2023-03-29,3,,incubating,"4/28: flag pulled" +2023,hidden,622,whib,2023-04-06,3,,incubating,"4/28: flag pulled" +2023,hidden,622,whib,2023-04-14,3,,incubating,"4/28: flag pulled" +2023,hidden,622,whib,2023-04-21,,3,nestling,"4/28: flag pulled" +2023,hidden,622,whib,2023-04-28,,,empty,"4/28: flag pulled" +2023,hidden,622,whib,2023-05-05,,,,"4/28: flag pulled" +2023,hidden,615,whib,2023-02-16,,,,"4/6: above unmarked SMHE nest; 4/28: flag pulled" +2023,hidden,615,whib,2023-02-23,,,,"4/6: above unmarked SMHE nest; 4/28: flag pulled" +2023,hidden,615,whib,2023-03-02,,,,"4/6: above unmarked SMHE nest; 4/28: flag pulled" +2023,hidden,615,whib,2023-03-09,,,,"4/6: above unmarked SMHE nest; 4/28: flag pulled" +2023,hidden,615,whib,2023-03-16,,,,"4/6: above unmarked SMHE nest; 4/28: flag pulled" +2023,hidden,615,whib,2023-03-23,,,,"4/6: above unmarked SMHE nest; 4/28: flag pulled" +2023,hidden,615,whib,2023-03-29,2,,incubating,"4/6: above unmarked SMHE nest; 4/28: flag pulled" +2023,hidden,615,whib,2023-04-06,2,,incubating,"4/6: above unmarked SMHE nest; 4/28: flag pulled" +2023,hidden,615,whib,2023-04-14,2,,incubating,"4/6: above unmarked SMHE nest; 4/28: flag pulled" +2023,hidden,615,whib,2023-04-21,3,,incubating,"4/6: above unmarked SMHE nest; 4/28: flag pulled" +2023,hidden,615,whib,2023-04-28,,,empty,"4/6: above unmarked SMHE nest; 4/28: flag pulled" +2023,hidden,615,whib,2023-05-05,,,,"4/6: above unmarked SMHE nest; 4/28: flag pulled" +2023,little_d,152,greg,2023-02-24,1,,incubating,"2/24: broken egg on ground under nest" +2023,little_d,152,greg,2023-03-03,,,empty,"2/24: broken egg on ground under nest" +2023,little_d,152,greg,2023-03-10,,,pulled,"2/24: broken egg on ground under nest" +2023,little_d,152,greg,2023-03-17,,,,"2/24: broken egg on ground under nest" +2023,little_d,152,greg,2023-03-24,,,,"2/24: broken egg on ground under nest" +2023,little_d,152,greg,2023-03-31,,,,"2/24: broken egg on ground under nest" +2023,little_d,152,greg,2023-04-07,,,,"2/24: broken egg on ground under nest" +2023,little_d,152,greg,2023-04-14,,,,"2/24: broken egg on ground under nest" +2023,little_d,152,greg,2023-04-21,,,,"2/24: broken egg on ground under nest" +2023,little_d,152,greg,2023-04-28,,,,"2/24: broken egg on ground under nest" +2023,little_d,152,greg,2023-05-04,,,,"2/24: broken egg on ground under nest" +2023,little_d,152,greg,2023-05-11,,,,"2/24: broken egg on ground under nest" +2023,little_d,189,greg,2023-02-24,3,,incubating,"3/24: 1 dead chick in nest 4/21: dead chick in nest" +2023,little_d,189,greg,2023-03-03,3,,incubating,"3/24: 1 dead chick in nest 4/21: dead chick in nest" +2023,little_d,189,greg,2023-03-10,3,,incubating,"3/24: 1 dead chick in nest 4/21: dead chick in nest" +2023,little_d,189,greg,2023-03-17,,3,nestling,"3/24: 1 dead chick in nest 4/21: dead chick in nest" +2023,little_d,189,greg,2023-03-24,,2,nestling,"3/24: 1 dead chick in nest 4/21: dead chick in nest" +2023,little_d,189,greg,2023-03-31,,2,nestling,"3/24: 1 dead chick in nest 4/21: dead chick in nest" +2023,little_d,189,greg,2023-04-07,,2,nestling,"3/24: 1 dead chick in nest 4/21: dead chick in nest" +2023,little_d,189,greg,2023-04-14,,2,nestling,"3/24: 1 dead chick in nest 4/21: dead chick in nest" +2023,little_d,189,greg,2023-04-21,,,empty,"3/24: 1 dead chick in nest 4/21: dead chick in nest" +2023,little_d,189,greg,2023-04-28,,,pulled,"3/24: 1 dead chick in nest 4/21: dead chick in nest" +2023,little_d,189,greg,2023-05-04,,,,"3/24: 1 dead chick in nest 4/21: dead chick in nest" +2023,little_d,189,greg,2023-05-11,,,,"3/24: 1 dead chick in nest 4/21: dead chick in nest" +2023,little_d,154,greg,2023-02-24,2,,incubating,"3/10: Egg pipping and one chick dry; 3/31: partially collapsed" +2023,little_d,154,greg,2023-03-03,2,,incubating,"3/10: Egg pipping and one chick dry; 3/31: partially collapsed" +2023,little_d,154,greg,2023-03-10,1,1,chick_dry,"3/10: Egg pipping and one chick dry; 3/31: partially collapsed" +2023,little_d,154,greg,2023-03-17,,2,nestling,"3/10: Egg pipping and one chick dry; 3/31: partially collapsed" +2023,little_d,154,greg,2023-03-24,,2,nestling,"3/10: Egg pipping and one chick dry; 3/31: partially collapsed" +2023,little_d,154,greg,2023-03-31,,,empty,"3/10: Egg pipping and one chick dry; 3/31: partially collapsed" +2023,little_d,154,greg,2023-04-07,,,pulled,"3/10: Egg pipping and one chick dry; 3/31: partially collapsed" +2023,little_d,154,greg,2023-04-14,,,,"3/10: Egg pipping and one chick dry; 3/31: partially collapsed" +2023,little_d,154,greg,2023-04-21,,,,"3/10: Egg pipping and one chick dry; 3/31: partially collapsed" +2023,little_d,154,greg,2023-04-28,,,,"3/10: Egg pipping and one chick dry; 3/31: partially collapsed" +2023,little_d,154,greg,2023-05-04,,,,"3/10: Egg pipping and one chick dry; 3/31: partially collapsed" +2023,little_d,154,greg,2023-05-11,,,,"3/10: Egg pipping and one chick dry; 3/31: partially collapsed" +2023,little_d,191,greg,2023-02-24,2,,incubating,"3/3: 2 broken eggs on the ground below nest 3/10: relay?" +2023,little_d,191,greg,2023-03-03,,,empty,"3/3: 2 broken eggs on the ground below nest 3/10: relay?" +2023,little_d,191,greg,2023-03-10,2,,incubating,"3/3: 2 broken eggs on the ground below nest 3/10: relay?" +2023,little_d,191,greg,2023-03-17,,,empty,"3/3: 2 broken eggs on the ground below nest 3/10: relay?" +2023,little_d,191,greg,2023-03-24,,,,"3/3: 2 broken eggs on the ground below nest 3/10: relay?" +2023,little_d,191,greg,2023-03-31,,,,"3/3: 2 broken eggs on the ground below nest 3/10: relay?" +2023,little_d,191,greg,2023-04-07,,,pulled,"3/3: 2 broken eggs on the ground below nest 3/10: relay?" +2023,little_d,191,greg,2023-04-14,,,,"3/3: 2 broken eggs on the ground below nest 3/10: relay?" +2023,little_d,191,greg,2023-04-21,,,,"3/3: 2 broken eggs on the ground below nest 3/10: relay?" +2023,little_d,191,greg,2023-04-28,,,,"3/3: 2 broken eggs on the ground below nest 3/10: relay?" +2023,little_d,191,greg,2023-05-04,,,,"3/3: 2 broken eggs on the ground below nest 3/10: relay?" +2023,little_d,191,greg,2023-05-11,,,,"3/3: 2 broken eggs on the ground below nest 3/10: relay?" +2023,little_d,156,greg,2023-02-24,3,,incubating,"3/10: 1 C damp, 1 C freshly hatched, eggshell in nestcup makes it look like 2 eggs" +2023,little_d,156,greg,2023-03-03,3,,incubating,"3/10: 1 C damp, 1 C freshly hatched, eggshell in nestcup makes it look like 2 eggs" +2023,little_d,156,greg,2023-03-10,1,2,wet_chick,"3/10: 1 C damp, 1 C freshly hatched, eggshell in nestcup makes it look like 2 eggs" +2023,little_d,156,greg,2023-03-17,,3,nestling,"3/10: 1 C damp, 1 C freshly hatched, eggshell in nestcup makes it look like 2 eggs" +2023,little_d,156,greg,2023-03-24,,,empty,"3/10: 1 C damp, 1 C freshly hatched, eggshell in nestcup makes it look like 2 eggs" +2023,little_d,156,greg,2023-03-31,,,,"3/10: 1 C damp, 1 C freshly hatched, eggshell in nestcup makes it look like 2 eggs" +2023,little_d,156,greg,2023-04-07,,,pulled,"3/10: 1 C damp, 1 C freshly hatched, eggshell in nestcup makes it look like 2 eggs" +2023,little_d,156,greg,2023-04-14,,,,"3/10: 1 C damp, 1 C freshly hatched, eggshell in nestcup makes it look like 2 eggs" +2023,little_d,156,greg,2023-04-21,,,,"3/10: 1 C damp, 1 C freshly hatched, eggshell in nestcup makes it look like 2 eggs" +2023,little_d,156,greg,2023-04-28,,,,"3/10: 1 C damp, 1 C freshly hatched, eggshell in nestcup makes it look like 2 eggs" +2023,little_d,156,greg,2023-05-04,,,,"3/10: 1 C damp, 1 C freshly hatched, eggshell in nestcup makes it look like 2 eggs" +2023,little_d,156,greg,2023-05-11,,,,"3/10: 1 C damp, 1 C freshly hatched, eggshell in nestcup makes it look like 2 eggs" +2023,little_d,158,greg,2023-02-24,3,,incubating,"4/7: 1 C+, nest empty, chick nearby in canopy" +2023,little_d,158,greg,2023-03-03,3,,incubating,"4/7: 1 C+, nest empty, chick nearby in canopy" +2023,little_d,158,greg,2023-03-10,3,,incubating,"4/7: 1 C+, nest empty, chick nearby in canopy" +2023,little_d,158,greg,2023-03-17,,3,nestling,"4/7: 1 C+, nest empty, chick nearby in canopy" +2023,little_d,158,greg,2023-03-24,,2,nestling,"4/7: 1 C+, nest empty, chick nearby in canopy" +2023,little_d,158,greg,2023-03-31,,2,nestling,"4/7: 1 C+, nest empty, chick nearby in canopy" +2023,little_d,158,greg,2023-04-07,,1,nestling,"4/7: 1 C+, nest empty, chick nearby in canopy" +2023,little_d,158,greg,2023-04-14,,,empty,"4/7: 1 C+, nest empty, chick nearby in canopy" +2023,little_d,158,greg,2023-04-21,,,pulled,"4/7: 1 C+, nest empty, chick nearby in canopy" +2023,little_d,158,greg,2023-04-28,,,,"4/7: 1 C+, nest empty, chick nearby in canopy" +2023,little_d,158,greg,2023-05-04,,,,"4/7: 1 C+, nest empty, chick nearby in canopy" +2023,little_d,158,greg,2023-05-11,,,,"4/7: 1 C+, nest empty, chick nearby in canopy" +2023,little_d,160,greg,2023-02-24,1,,incubating,"4/7: One chick very small, probably dead" +2023,little_d,160,greg,2023-03-03,3,,incubating,"4/7: One chick very small, probably dead" +2023,little_d,160,greg,2023-03-10,3,,incubating,"4/7: One chick very small, probably dead" +2023,little_d,160,greg,2023-03-17,3,,incubating,"4/7: One chick very small, probably dead" +2023,little_d,160,greg,2023-03-24,2,1,hatching,"4/7: One chick very small, probably dead" +2023,little_d,160,greg,2023-03-31,,3,nestling,"4/7: One chick very small, probably dead" +2023,little_d,160,greg,2023-04-07,,3,nestling,"4/7: One chick very small, probably dead" +2023,little_d,160,greg,2023-04-14,,,empty,"4/7: One chick very small, probably dead" +2023,little_d,160,greg,2023-04-21,,,pulled,"4/7: One chick very small, probably dead" +2023,little_d,160,greg,2023-04-28,,,,"4/7: One chick very small, probably dead" +2023,little_d,160,greg,2023-05-04,,,,"4/7: One chick very small, probably dead" +2023,little_d,160,greg,2023-05-11,,,,"4/7: One chick very small, probably dead" +2023,little_d,162,greg,2023-02-24,3,,incubating,"4/7: One dead chick on the ground below nest, sampled dead chick for mercury 4/21: second dead chick below nest, pulled flagging" +2023,little_d,162,greg,2023-03-03,3,,incubating,"4/7: One dead chick on the ground below nest, sampled dead chick for mercury 4/21: second dead chick below nest, pulled flagging" +2023,little_d,162,greg,2023-03-10,3,,incubating,"4/7: One dead chick on the ground below nest, sampled dead chick for mercury 4/21: second dead chick below nest, pulled flagging" +2023,little_d,162,greg,2023-03-17,,3,nestling,"4/7: One dead chick on the ground below nest, sampled dead chick for mercury 4/21: second dead chick below nest, pulled flagging" +2023,little_d,162,greg,2023-03-24,,3,nestling,"4/7: One dead chick on the ground below nest, sampled dead chick for mercury 4/21: second dead chick below nest, pulled flagging" +2023,little_d,162,greg,2023-03-31,,2,nestling,"4/7: One dead chick on the ground below nest, sampled dead chick for mercury 4/21: second dead chick below nest, pulled flagging" +2023,little_d,162,greg,2023-04-07,,1,nestling,"4/7: One dead chick on the ground below nest, sampled dead chick for mercury 4/21: second dead chick below nest, pulled flagging" +2023,little_d,162,greg,2023-04-14,,1,nestling,"4/7: One dead chick on the ground below nest, sampled dead chick for mercury 4/21: second dead chick below nest, pulled flagging" +2023,little_d,162,greg,2023-04-21,,,empty,"4/7: One dead chick on the ground below nest, sampled dead chick for mercury 4/21: second dead chick below nest, pulled flagging" +2023,little_d,162,greg,2023-04-28,,,,"4/7: One dead chick on the ground below nest, sampled dead chick for mercury 4/21: second dead chick below nest, pulled flagging" +2023,little_d,162,greg,2023-05-04,,,,"4/7: One dead chick on the ground below nest, sampled dead chick for mercury 4/21: second dead chick below nest, pulled flagging" +2023,little_d,162,greg,2023-05-11,,,,"4/7: One dead chick on the ground below nest, sampled dead chick for mercury 4/21: second dead chick below nest, pulled flagging" +2023,little_d,335,greg,2023-02-24,,,,"3/3: nest first in transect, before split" +2023,little_d,335,greg,2023-03-03,2,,incubating,"3/3: nest first in transect, before split" +2023,little_d,335,greg,2023-03-10,2,,incubating,"3/3: nest first in transect, before split" +2023,little_d,335,greg,2023-03-17,,,empty,"3/3: nest first in transect, before split" +2023,little_d,335,greg,2023-03-24,,,,"3/3: nest first in transect, before split" +2023,little_d,335,greg,2023-03-31,,,,"3/3: nest first in transect, before split" +2023,little_d,335,greg,2023-04-07,,,pulled,"3/3: nest first in transect, before split" +2023,little_d,335,greg,2023-04-14,,,,"3/3: nest first in transect, before split" +2023,little_d,335,greg,2023-04-21,,,,"3/3: nest first in transect, before split" +2023,little_d,335,greg,2023-04-28,,,,"3/3: nest first in transect, before split" +2023,little_d,335,greg,2023-05-04,,,,"3/3: nest first in transect, before split" +2023,little_d,335,greg,2023-05-11,,,,"3/3: nest first in transect, before split" +2023,little_d,193,greg,2023-02-24,2,,incubating,"3/3: nest high above number 3/24: 1 dead chick, chick still in nest not obviously moving, possibly dead; 3/31: both chicks now dead" +2023,little_d,193,greg,2023-03-03,2,,incubating,"3/3: nest high above number 3/24: 1 dead chick, chick still in nest not obviously moving, possibly dead; 3/31: both chicks now dead" +2023,little_d,193,greg,2023-03-10,2,,incubating,"3/3: nest high above number 3/24: 1 dead chick, chick still in nest not obviously moving, possibly dead; 3/31: both chicks now dead" +2023,little_d,193,greg,2023-03-17,,2,nestling,"3/3: nest high above number 3/24: 1 dead chick, chick still in nest not obviously moving, possibly dead; 3/31: both chicks now dead" +2023,little_d,193,greg,2023-03-24,,1,nestling,"3/3: nest high above number 3/24: 1 dead chick, chick still in nest not obviously moving, possibly dead; 3/31: both chicks now dead" +2023,little_d,193,greg,2023-03-31,,,empty,"3/3: nest high above number 3/24: 1 dead chick, chick still in nest not obviously moving, possibly dead; 3/31: both chicks now dead" +2023,little_d,193,greg,2023-04-07,,,pulled,"3/3: nest high above number 3/24: 1 dead chick, chick still in nest not obviously moving, possibly dead; 3/31: both chicks now dead" +2023,little_d,193,greg,2023-04-14,,,,"3/3: nest high above number 3/24: 1 dead chick, chick still in nest not obviously moving, possibly dead; 3/31: both chicks now dead" +2023,little_d,193,greg,2023-04-21,,,,"3/3: nest high above number 3/24: 1 dead chick, chick still in nest not obviously moving, possibly dead; 3/31: both chicks now dead" +2023,little_d,193,greg,2023-04-28,,,,"3/3: nest high above number 3/24: 1 dead chick, chick still in nest not obviously moving, possibly dead; 3/31: both chicks now dead" +2023,little_d,193,greg,2023-05-04,,,,"3/3: nest high above number 3/24: 1 dead chick, chick still in nest not obviously moving, possibly dead; 3/31: both chicks now dead" +2023,little_d,193,greg,2023-05-11,,,,"3/3: nest high above number 3/24: 1 dead chick, chick still in nest not obviously moving, possibly dead; 3/31: both chicks now dead" +2023,little_d,164,greg,2023-02-24,3,,incubating,"3/3: on offshoot to right of trail 4/7: larger chick mercury sampled 4/21: dead chick below nest, and one larger chick in canopy" +2023,little_d,164,greg,2023-03-03,3,,incubating,"3/3: on offshoot to right of trail 4/7: larger chick mercury sampled 4/21: dead chick below nest, and one larger chick in canopy" +2023,little_d,164,greg,2023-03-10,1,2,chick_dry,"3/3: on offshoot to right of trail 4/7: larger chick mercury sampled 4/21: dead chick below nest, and one larger chick in canopy" +2023,little_d,164,greg,2023-03-17,,3,nestling,"3/3: on offshoot to right of trail 4/7: larger chick mercury sampled 4/21: dead chick below nest, and one larger chick in canopy" +2023,little_d,164,greg,2023-03-24,,2,nestling,"3/3: on offshoot to right of trail 4/7: larger chick mercury sampled 4/21: dead chick below nest, and one larger chick in canopy" +2023,little_d,164,greg,2023-03-31,,2,nestling,"3/3: on offshoot to right of trail 4/7: larger chick mercury sampled 4/21: dead chick below nest, and one larger chick in canopy" +2023,little_d,164,greg,2023-04-07,,2,nestling,"3/3: on offshoot to right of trail 4/7: larger chick mercury sampled 4/21: dead chick below nest, and one larger chick in canopy" +2023,little_d,164,greg,2023-04-14,,1,nestling,"3/3: on offshoot to right of trail 4/7: larger chick mercury sampled 4/21: dead chick below nest, and one larger chick in canopy" +2023,little_d,164,greg,2023-04-21,,,empty,"3/3: on offshoot to right of trail 4/7: larger chick mercury sampled 4/21: dead chick below nest, and one larger chick in canopy" +2023,little_d,164,greg,2023-04-28,,,pulled,"3/3: on offshoot to right of trail 4/7: larger chick mercury sampled 4/21: dead chick below nest, and one larger chick in canopy" +2023,little_d,164,greg,2023-05-04,,,,"3/3: on offshoot to right of trail 4/7: larger chick mercury sampled 4/21: dead chick below nest, and one larger chick in canopy" +2023,little_d,164,greg,2023-05-11,,,,"3/3: on offshoot to right of trail 4/7: larger chick mercury sampled 4/21: dead chick below nest, and one larger chick in canopy" +2023,little_d,195,greg,2023-02-24,3,,incubating,"2/24: nest to right of trail on offshoot; 3/31: 1 dead chick still in nest 4/14: One large chick" +2023,little_d,195,greg,2023-03-03,3,,incubating,"2/24: nest to right of trail on offshoot; 3/31: 1 dead chick still in nest 4/14: One large chick" +2023,little_d,195,greg,2023-03-10,1,2,chick_dry,"2/24: nest to right of trail on offshoot; 3/31: 1 dead chick still in nest 4/14: One large chick" +2023,little_d,195,greg,2023-03-17,,3,nestling,"2/24: nest to right of trail on offshoot; 3/31: 1 dead chick still in nest 4/14: One large chick" +2023,little_d,195,greg,2023-03-24,,3,nestling,"2/24: nest to right of trail on offshoot; 3/31: 1 dead chick still in nest 4/14: One large chick" +2023,little_d,195,greg,2023-03-31,,2,nestling,"2/24: nest to right of trail on offshoot; 3/31: 1 dead chick still in nest 4/14: One large chick" +2023,little_d,195,greg,2023-04-07,,,empty,"2/24: nest to right of trail on offshoot; 3/31: 1 dead chick still in nest 4/14: One large chick" +2023,little_d,195,greg,2023-04-14,,1,nestling,"2/24: nest to right of trail on offshoot; 3/31: 1 dead chick still in nest 4/14: One large chick" +2023,little_d,195,greg,2023-04-21,,,empty,"2/24: nest to right of trail on offshoot; 3/31: 1 dead chick still in nest 4/14: One large chick" +2023,little_d,195,greg,2023-04-28,,,pulled,"2/24: nest to right of trail on offshoot; 3/31: 1 dead chick still in nest 4/14: One large chick" +2023,little_d,195,greg,2023-05-04,,,,"2/24: nest to right of trail on offshoot; 3/31: 1 dead chick still in nest 4/14: One large chick" +2023,little_d,195,greg,2023-05-11,,,,"2/24: nest to right of trail on offshoot; 3/31: 1 dead chick still in nest 4/14: One large chick" +2023,little_d,166,greg,2023-02-24,2,,incubating,"3/3: nest to right of trail on offshoot; 3/31: reflagged, old flag gone 4/21: at least one big branchling in general area" +2023,little_d,166,greg,2023-03-03,2,,incubating,"3/3: nest to right of trail on offshoot; 3/31: reflagged, old flag gone 4/21: at least one big branchling in general area" +2023,little_d,166,greg,2023-03-10,,2,chick_dry,"3/3: nest to right of trail on offshoot; 3/31: reflagged, old flag gone 4/21: at least one big branchling in general area" +2023,little_d,166,greg,2023-03-17,,2,nestling,"3/3: nest to right of trail on offshoot; 3/31: reflagged, old flag gone 4/21: at least one big branchling in general area" +2023,little_d,166,greg,2023-03-24,,2,nestling,"3/3: nest to right of trail on offshoot; 3/31: reflagged, old flag gone 4/21: at least one big branchling in general area" +2023,little_d,166,greg,2023-03-31,,2,nestling,"3/3: nest to right of trail on offshoot; 3/31: reflagged, old flag gone 4/21: at least one big branchling in general area" +2023,little_d,166,greg,2023-04-07,,2,nestling,"3/3: nest to right of trail on offshoot; 3/31: reflagged, old flag gone 4/21: at least one big branchling in general area" +2023,little_d,166,greg,2023-04-14,,2,nestling,"3/3: nest to right of trail on offshoot; 3/31: reflagged, old flag gone 4/21: at least one big branchling in general area" +2023,little_d,166,greg,2023-04-21,,,empty,"3/3: nest to right of trail on offshoot; 3/31: reflagged, old flag gone 4/21: at least one big branchling in general area" +2023,little_d,166,greg,2023-04-28,,,pulled,"3/3: nest to right of trail on offshoot; 3/31: reflagged, old flag gone 4/21: at least one big branchling in general area" +2023,little_d,166,greg,2023-05-04,,,,"3/3: nest to right of trail on offshoot; 3/31: reflagged, old flag gone 4/21: at least one big branchling in general area" +2023,little_d,166,greg,2023-05-11,,,,"3/3: nest to right of trail on offshoot; 3/31: reflagged, old flag gone 4/21: at least one big branchling in general area" +2023,little_d,201,greg,2023-02-24,3,,incubating,"2/24: nest to right of trail on offshoot 3/24: found flag on ground, re-flagged nest nearest flag; 3/31: flag gone, reflagged w/blue 4/21: dead chick in nest, 1 large branchling around, but could be from another nest" +2023,little_d,201,greg,2023-03-03,3,,incubating,"2/24: nest to right of trail on offshoot 3/24: found flag on ground, re-flagged nest nearest flag; 3/31: flag gone, reflagged w/blue 4/21: dead chick in nest, 1 large branchling around, but could be from another nest" +2023,little_d,201,greg,2023-03-10,3,,incubating,"2/24: nest to right of trail on offshoot 3/24: found flag on ground, re-flagged nest nearest flag; 3/31: flag gone, reflagged w/blue 4/21: dead chick in nest, 1 large branchling around, but could be from another nest" +2023,little_d,201,greg,2023-03-17,,3,nestling,"2/24: nest to right of trail on offshoot 3/24: found flag on ground, re-flagged nest nearest flag; 3/31: flag gone, reflagged w/blue 4/21: dead chick in nest, 1 large branchling around, but could be from another nest" +2023,little_d,201,greg,2023-03-24,,3,nestling,"2/24: nest to right of trail on offshoot 3/24: found flag on ground, re-flagged nest nearest flag; 3/31: flag gone, reflagged w/blue 4/21: dead chick in nest, 1 large branchling around, but could be from another nest" +2023,little_d,201,greg,2023-03-31,,2,nestling,"2/24: nest to right of trail on offshoot 3/24: found flag on ground, re-flagged nest nearest flag; 3/31: flag gone, reflagged w/blue 4/21: dead chick in nest, 1 large branchling around, but could be from another nest" +2023,little_d,201,greg,2023-04-07,,2,nestling,"2/24: nest to right of trail on offshoot 3/24: found flag on ground, re-flagged nest nearest flag; 3/31: flag gone, reflagged w/blue 4/21: dead chick in nest, 1 large branchling around, but could be from another nest" +2023,little_d,201,greg,2023-04-14,,2,nestling,"2/24: nest to right of trail on offshoot 3/24: found flag on ground, re-flagged nest nearest flag; 3/31: flag gone, reflagged w/blue 4/21: dead chick in nest, 1 large branchling around, but could be from another nest" +2023,little_d,201,greg,2023-04-21,,,empty,"2/24: nest to right of trail on offshoot 3/24: found flag on ground, re-flagged nest nearest flag; 3/31: flag gone, reflagged w/blue 4/21: dead chick in nest, 1 large branchling around, but could be from another nest" +2023,little_d,201,greg,2023-04-28,,,pulled,"2/24: nest to right of trail on offshoot 3/24: found flag on ground, re-flagged nest nearest flag; 3/31: flag gone, reflagged w/blue 4/21: dead chick in nest, 1 large branchling around, but could be from another nest" +2023,little_d,201,greg,2023-05-04,,,,"2/24: nest to right of trail on offshoot 3/24: found flag on ground, re-flagged nest nearest flag; 3/31: flag gone, reflagged w/blue 4/21: dead chick in nest, 1 large branchling around, but could be from another nest" +2023,little_d,201,greg,2023-05-11,,,,"2/24: nest to right of trail on offshoot 3/24: found flag on ground, re-flagged nest nearest flag; 3/31: flag gone, reflagged w/blue 4/21: dead chick in nest, 1 large branchling around, but could be from another nest" +2023,little_d,203,greg,2023-02-24,3,,incubating,"4/28 large dead chick in area ~5m away; 5/4: Flag pulled" +2023,little_d,203,greg,2023-03-03,3,,incubating,"4/28 large dead chick in area ~5m away; 5/4: Flag pulled" +2023,little_d,203,greg,2023-03-10,3,,incubating,"4/28 large dead chick in area ~5m away; 5/4: Flag pulled" +2023,little_d,203,greg,2023-03-17,1,2,hatching,"4/28 large dead chick in area ~5m away; 5/4: Flag pulled" +2023,little_d,203,greg,2023-03-24,,3,nestling,"4/28 large dead chick in area ~5m away; 5/4: Flag pulled" +2023,little_d,203,greg,2023-03-31,,2,nestling,"4/28 large dead chick in area ~5m away; 5/4: Flag pulled" +2023,little_d,203,greg,2023-04-07,,2,nestling,"4/28 large dead chick in area ~5m away; 5/4: Flag pulled" +2023,little_d,203,greg,2023-04-14,,2,nestling,"4/28 large dead chick in area ~5m away; 5/4: Flag pulled" +2023,little_d,203,greg,2023-04-21,,1,branchling,"4/28 large dead chick in area ~5m away; 5/4: Flag pulled" +2023,little_d,203,greg,2023-04-28,,1,branchling,"4/28 large dead chick in area ~5m away; 5/4: Flag pulled" +2023,little_d,203,greg,2023-05-04,,,empty,"4/28 large dead chick in area ~5m away; 5/4: Flag pulled" +2023,little_d,203,greg,2023-05-11,,,,"4/28 large dead chick in area ~5m away; 5/4: Flag pulled" +2023,little_d,394,greg,2023-02-24,,,, +2023,little_d,394,greg,2023-03-03,,,, +2023,little_d,394,greg,2023-03-10,2,,incubating, +2023,little_d,394,greg,2023-03-17,2,,incubating, +2023,little_d,394,greg,2023-03-24,2,,incubating, +2023,little_d,394,greg,2023-03-31,,,empty, +2023,little_d,394,greg,2023-04-07,,,pulled, +2023,little_d,394,greg,2023-04-14,,,, +2023,little_d,394,greg,2023-04-21,,,, +2023,little_d,394,greg,2023-04-28,,,, +2023,little_d,394,greg,2023-05-04,,,, +2023,little_d,394,greg,2023-05-11,,,, +2023,little_d,168,greg,2023-02-24,3,,incubating,"3/17: one egg pipping; 4/14: did not look for egg (probs dead anyway)" +2023,little_d,168,greg,2023-03-03,3,,incubating,"3/17: one egg pipping; 4/14: did not look for egg (probs dead anyway)" +2023,little_d,168,greg,2023-03-10,3,,incubating,"3/17: one egg pipping; 4/14: did not look for egg (probs dead anyway)" +2023,little_d,168,greg,2023-03-17,3,,pipping,"3/17: one egg pipping; 4/14: did not look for egg (probs dead anyway)" +2023,little_d,168,greg,2023-03-24,2,1,chick_dry,"3/17: one egg pipping; 4/14: did not look for egg (probs dead anyway)" +2023,little_d,168,greg,2023-03-31,2,1,nestling,"3/17: one egg pipping; 4/14: did not look for egg (probs dead anyway)" +2023,little_d,168,greg,2023-04-07,1,1,nestling,"3/17: one egg pipping; 4/14: did not look for egg (probs dead anyway)" +2023,little_d,168,greg,2023-04-14,,1,nestling,"3/17: one egg pipping; 4/14: did not look for egg (probs dead anyway)" +2023,little_d,168,greg,2023-04-21,,,empty,"3/17: one egg pipping; 4/14: did not look for egg (probs dead anyway)" +2023,little_d,168,greg,2023-04-28,,,pulled,"3/17: one egg pipping; 4/14: did not look for egg (probs dead anyway)" +2023,little_d,168,greg,2023-05-04,,,,"3/17: one egg pipping; 4/14: did not look for egg (probs dead anyway)" +2023,little_d,168,greg,2023-05-11,,,,"3/17: one egg pipping; 4/14: did not look for egg (probs dead anyway)" +2023,little_d,205,greg,2023-02-24,3,,incubating,"3/24: 1 chick might be dead" +2023,little_d,205,greg,2023-03-03,3,,incubating,"3/24: 1 chick might be dead" +2023,little_d,205,greg,2023-03-10,3,,incubating,"3/24: 1 chick might be dead" +2023,little_d,205,greg,2023-03-17,2,1,hatching,"3/24: 1 chick might be dead" +2023,little_d,205,greg,2023-03-24,,3,nestling,"3/24: 1 chick might be dead" +2023,little_d,205,greg,2023-03-31,,1,nestling,"3/24: 1 chick might be dead" +2023,little_d,205,greg,2023-04-07,,1,nestling,"3/24: 1 chick might be dead" +2023,little_d,205,greg,2023-04-14,,1,nestling,"3/24: 1 chick might be dead" +2023,little_d,205,greg,2023-04-21,,1,nestling,"3/24: 1 chick might be dead" +2023,little_d,205,greg,2023-04-28,,,empty,"3/24: 1 chick might be dead" +2023,little_d,205,greg,2023-05-04,,,,"3/24: 1 chick might be dead" +2023,little_d,205,greg,2023-05-11,,,,"3/24: 1 chick might be dead" +2023,little_d,170,greg,2023-02-24,2,,incubating, +2023,little_d,170,greg,2023-03-03,2,,incubating, +2023,little_d,170,greg,2023-03-10,2,,incubating, +2023,little_d,170,greg,2023-03-17,2,,incubating, +2023,little_d,170,greg,2023-03-24,2,,incubating, +2023,little_d,170,greg,2023-03-31,,,empty, +2023,little_d,170,greg,2023-04-07,,,pulled, +2023,little_d,170,greg,2023-04-14,,,, +2023,little_d,170,greg,2023-04-21,,,, +2023,little_d,170,greg,2023-04-28,,,, +2023,little_d,170,greg,2023-05-04,,,, +2023,little_d,170,greg,2023-05-11,,,, +2023,little_d,207,greg,2023-02-24,1,,incubating,"2/24: broken egg on ground near nest 3/24: 1 chick wet, 1 chick dry; 4/14: flag pulled" +2023,little_d,207,greg,2023-03-03,2,,incubating,"2/24: broken egg on ground near nest 3/24: 1 chick wet, 1 chick dry; 4/14: flag pulled" +2023,little_d,207,greg,2023-03-10,2,,incubating,"2/24: broken egg on ground near nest 3/24: 1 chick wet, 1 chick dry; 4/14: flag pulled" +2023,little_d,207,greg,2023-03-17,2,,incubating,"2/24: broken egg on ground near nest 3/24: 1 chick wet, 1 chick dry; 4/14: flag pulled" +2023,little_d,207,greg,2023-03-24,,2,wet_chick,"2/24: broken egg on ground near nest 3/24: 1 chick wet, 1 chick dry; 4/14: flag pulled" +2023,little_d,207,greg,2023-03-31,,,empty,"2/24: broken egg on ground near nest 3/24: 1 chick wet, 1 chick dry; 4/14: flag pulled" +2023,little_d,207,greg,2023-04-07,,,empty,"2/24: broken egg on ground near nest 3/24: 1 chick wet, 1 chick dry; 4/14: flag pulled" +2023,little_d,207,greg,2023-04-14,,,pulled,"2/24: broken egg on ground near nest 3/24: 1 chick wet, 1 chick dry; 4/14: flag pulled" +2023,little_d,207,greg,2023-04-21,,,,"2/24: broken egg on ground near nest 3/24: 1 chick wet, 1 chick dry; 4/14: flag pulled" +2023,little_d,207,greg,2023-04-28,,,,"2/24: broken egg on ground near nest 3/24: 1 chick wet, 1 chick dry; 4/14: flag pulled" +2023,little_d,207,greg,2023-05-04,,,,"2/24: broken egg on ground near nest 3/24: 1 chick wet, 1 chick dry; 4/14: flag pulled" +2023,little_d,207,greg,2023-05-11,,,,"2/24: broken egg on ground near nest 3/24: 1 chick wet, 1 chick dry; 4/14: flag pulled" +2023,little_d,172,greg,2023-02-24,2,,incubating,"2/24: one very small egg 3/17: one very small egg" +2023,little_d,172,greg,2023-03-03,2,,incubating,"2/24: one very small egg 3/17: one very small egg" +2023,little_d,172,greg,2023-03-10,2,,incubating,"2/24: one very small egg 3/17: one very small egg" +2023,little_d,172,greg,2023-03-17,2,,incubating,"2/24: one very small egg 3/17: one very small egg" +2023,little_d,172,greg,2023-03-24,1,1,chick_dry,"2/24: one very small egg 3/17: one very small egg" +2023,little_d,172,greg,2023-03-31,,1,nestling,"2/24: one very small egg 3/17: one very small egg" +2023,little_d,172,greg,2023-04-07,,1,nestling,"2/24: one very small egg 3/17: one very small egg" +2023,little_d,172,greg,2023-04-14,,1,nestling,"2/24: one very small egg 3/17: one very small egg" +2023,little_d,172,greg,2023-04-21,,1,nestling,"2/24: one very small egg 3/17: one very small egg" +2023,little_d,172,greg,2023-04-28,,1,nestling,"2/24: one very small egg 3/17: one very small egg" +2023,little_d,172,greg,2023-05-04,,,empty,"2/24: one very small egg 3/17: one very small egg" +2023,little_d,172,greg,2023-05-11,,,,"2/24: one very small egg 3/17: one very small egg" +2023,little_d,209,greg,2023-02-24,3,,incubating,"4/28 large chick nearby, probably from another nest" +2023,little_d,209,greg,2023-03-03,3,,incubating,"4/28 large chick nearby, probably from another nest" +2023,little_d,209,greg,2023-03-10,1,2,chick_dry,"4/28 large chick nearby, probably from another nest" +2023,little_d,209,greg,2023-03-17,,3,nestling,"4/28 large chick nearby, probably from another nest" +2023,little_d,209,greg,2023-03-24,,2,nestling,"4/28 large chick nearby, probably from another nest" +2023,little_d,209,greg,2023-03-31,,2,nestling,"4/28 large chick nearby, probably from another nest" +2023,little_d,209,greg,2023-04-07,,2,nestling,"4/28 large chick nearby, probably from another nest" +2023,little_d,209,greg,2023-04-14,,,missed,"4/28 large chick nearby, probably from another nest" +2023,little_d,209,greg,2023-04-21,,,missed,"4/28 large chick nearby, probably from another nest" +2023,little_d,209,greg,2023-04-28,,,empty,"4/28 large chick nearby, probably from another nest" +2023,little_d,209,greg,2023-05-04,,,pulled,"4/28 large chick nearby, probably from another nest" +2023,little_d,209,greg,2023-05-11,,,,"4/28 large chick nearby, probably from another nest" +2023,little_d,174,greg,2023-02-24,2,,incubating,"4/21: Big branchling around; 5/4: Chick flew away. Flag pulled" +2023,little_d,174,greg,2023-03-03,2,,incubating,"4/21: Big branchling around; 5/4: Chick flew away. Flag pulled" +2023,little_d,174,greg,2023-03-10,2,,incubating,"4/21: Big branchling around; 5/4: Chick flew away. Flag pulled" +2023,little_d,174,greg,2023-03-17,2,,incubating,"4/21: Big branchling around; 5/4: Chick flew away. Flag pulled" +2023,little_d,174,greg,2023-03-24,1,1,chick_dry,"4/21: Big branchling around; 5/4: Chick flew away. Flag pulled" +2023,little_d,174,greg,2023-03-31,,1,nestling,"4/21: Big branchling around; 5/4: Chick flew away. Flag pulled" +2023,little_d,174,greg,2023-04-07,,1,nestling,"4/21: Big branchling around; 5/4: Chick flew away. Flag pulled" +2023,little_d,174,greg,2023-04-14,,1,nestling,"4/21: Big branchling around; 5/4: Chick flew away. Flag pulled" +2023,little_d,174,greg,2023-04-21,,,empty,"4/21: Big branchling around; 5/4: Chick flew away. Flag pulled" +2023,little_d,174,greg,2023-04-28,,1,branchling,"4/21: Big branchling around; 5/4: Chick flew away. Flag pulled" +2023,little_d,174,greg,2023-05-04,,1,fledged,"4/21: Big branchling around; 5/4: Chick flew away. Flag pulled" +2023,little_d,174,greg,2023-05-11,,,,"4/21: Big branchling around; 5/4: Chick flew away. Flag pulled" +2023,little_d,176,greg,2023-02-24,2,,incubating,"5/4: Flag pulled" +2023,little_d,176,greg,2023-03-03,3,,incubating,"5/4: Flag pulled" +2023,little_d,176,greg,2023-03-10,3,,incubating,"5/4: Flag pulled" +2023,little_d,176,greg,2023-03-17,3,,incubating,"5/4: Flag pulled" +2023,little_d,176,greg,2023-03-24,,3,nestling,"5/4: Flag pulled" +2023,little_d,176,greg,2023-03-31,,3,nestling,"5/4: Flag pulled" +2023,little_d,176,greg,2023-04-07,,2,nestling,"5/4: Flag pulled" +2023,little_d,176,greg,2023-04-14,,2,nestling,"5/4: Flag pulled" +2023,little_d,176,greg,2023-04-21,,2,nestling,"5/4: Flag pulled" +2023,little_d,176,greg,2023-04-28,,,empty,"5/4: Flag pulled" +2023,little_d,176,greg,2023-05-04,,,empty,"5/4: Flag pulled" +2023,little_d,176,greg,2023-05-11,,,,"5/4: Flag pulled" +2023,little_d,211,greg,2023-02-24,3,,incubating,"3/3: both chicks dry 3/10: at least 2 chicks seen, a third was possible 3/24: 1 dead chick hanging nearby; 3/31: Both observed chicks standing on outer edge of 211 nest, unmarked nest nearby with at least 2 chicks in the same general area but farther from marked nest 4/21: 2 big chicks in branches in general area of 211 and 396" +2023,little_d,211,greg,2023-03-03,1,2,chick_dry,"3/3: both chicks dry 3/10: at least 2 chicks seen, a third was possible 3/24: 1 dead chick hanging nearby; 3/31: Both observed chicks standing on outer edge of 211 nest, unmarked nest nearby with at least 2 chicks in the same general area but farther from marked nest 4/21: 2 big chicks in branches in general area of 211 and 396" +2023,little_d,211,greg,2023-03-10,,2,chick_dry,"3/3: both chicks dry 3/10: at least 2 chicks seen, a third was possible 3/24: 1 dead chick hanging nearby; 3/31: Both observed chicks standing on outer edge of 211 nest, unmarked nest nearby with at least 2 chicks in the same general area but farther from marked nest 4/21: 2 big chicks in branches in general area of 211 and 396" +2023,little_d,211,greg,2023-03-17,,2,nestling,"3/3: both chicks dry 3/10: at least 2 chicks seen, a third was possible 3/24: 1 dead chick hanging nearby; 3/31: Both observed chicks standing on outer edge of 211 nest, unmarked nest nearby with at least 2 chicks in the same general area but farther from marked nest 4/21: 2 big chicks in branches in general area of 211 and 396" +2023,little_d,211,greg,2023-03-24,,1,nestling,"3/3: both chicks dry 3/10: at least 2 chicks seen, a third was possible 3/24: 1 dead chick hanging nearby; 3/31: Both observed chicks standing on outer edge of 211 nest, unmarked nest nearby with at least 2 chicks in the same general area but farther from marked nest 4/21: 2 big chicks in branches in general area of 211 and 396" +2023,little_d,211,greg,2023-03-31,,2,nestling,"3/3: both chicks dry 3/10: at least 2 chicks seen, a third was possible 3/24: 1 dead chick hanging nearby; 3/31: Both observed chicks standing on outer edge of 211 nest, unmarked nest nearby with at least 2 chicks in the same general area but farther from marked nest 4/21: 2 big chicks in branches in general area of 211 and 396" +2023,little_d,211,greg,2023-04-07,,,empty,"3/3: both chicks dry 3/10: at least 2 chicks seen, a third was possible 3/24: 1 dead chick hanging nearby; 3/31: Both observed chicks standing on outer edge of 211 nest, unmarked nest nearby with at least 2 chicks in the same general area but farther from marked nest 4/21: 2 big chicks in branches in general area of 211 and 396" +2023,little_d,211,greg,2023-04-14,,,empty,"3/3: both chicks dry 3/10: at least 2 chicks seen, a third was possible 3/24: 1 dead chick hanging nearby; 3/31: Both observed chicks standing on outer edge of 211 nest, unmarked nest nearby with at least 2 chicks in the same general area but farther from marked nest 4/21: 2 big chicks in branches in general area of 211 and 396" +2023,little_d,211,greg,2023-04-21,,,empty,"3/3: both chicks dry 3/10: at least 2 chicks seen, a third was possible 3/24: 1 dead chick hanging nearby; 3/31: Both observed chicks standing on outer edge of 211 nest, unmarked nest nearby with at least 2 chicks in the same general area but farther from marked nest 4/21: 2 big chicks in branches in general area of 211 and 396" +2023,little_d,211,greg,2023-04-28,,,empty,"3/3: both chicks dry 3/10: at least 2 chicks seen, a third was possible 3/24: 1 dead chick hanging nearby; 3/31: Both observed chicks standing on outer edge of 211 nest, unmarked nest nearby with at least 2 chicks in the same general area but farther from marked nest 4/21: 2 big chicks in branches in general area of 211 and 396" +2023,little_d,211,greg,2023-05-04,,,,"3/3: both chicks dry 3/10: at least 2 chicks seen, a third was possible 3/24: 1 dead chick hanging nearby; 3/31: Both observed chicks standing on outer edge of 211 nest, unmarked nest nearby with at least 2 chicks in the same general area but farther from marked nest 4/21: 2 big chicks in branches in general area of 211 and 396" +2023,little_d,211,greg,2023-05-11,,,,"3/3: both chicks dry 3/10: at least 2 chicks seen, a third was possible 3/24: 1 dead chick hanging nearby; 3/31: Both observed chicks standing on outer edge of 211 nest, unmarked nest nearby with at least 2 chicks in the same general area but farther from marked nest 4/21: 2 big chicks in branches in general area of 211 and 396" +2023,little_d,178,greg,2023-02-24,2,,incubating,"4/21: 1 live chick and one dead chick, 4/28 big branchling in area" +2023,little_d,178,greg,2023-03-03,2,,incubating,"4/21: 1 live chick and one dead chick, 4/28 big branchling in area" +2023,little_d,178,greg,2023-03-10,2,,incubating,"4/21: 1 live chick and one dead chick, 4/28 big branchling in area" +2023,little_d,178,greg,2023-03-17,2,,incubating,"4/21: 1 live chick and one dead chick, 4/28 big branchling in area" +2023,little_d,178,greg,2023-03-24,,2,nestling,"4/21: 1 live chick and one dead chick, 4/28 big branchling in area" +2023,little_d,178,greg,2023-03-31,,2,nestling,"4/21: 1 live chick and one dead chick, 4/28 big branchling in area" +2023,little_d,178,greg,2023-04-07,,2,nestling,"4/21: 1 live chick and one dead chick, 4/28 big branchling in area" +2023,little_d,178,greg,2023-04-14,,2,nestling,"4/21: 1 live chick and one dead chick, 4/28 big branchling in area" +2023,little_d,178,greg,2023-04-21,,1,nestling,"4/21: 1 live chick and one dead chick, 4/28 big branchling in area" +2023,little_d,178,greg,2023-04-28,,,empty,"4/21: 1 live chick and one dead chick, 4/28 big branchling in area" +2023,little_d,178,greg,2023-05-04,,,pulled,"4/21: 1 live chick and one dead chick, 4/28 big branchling in area" +2023,little_d,178,greg,2023-05-11,,,,"4/21: 1 live chick and one dead chick, 4/28 big branchling in area" +2023,little_d,180,greg,2023-02-24,2,,incubating,"2/24: GREG nest, small eggs, 3/17: chick hatching out of egg now 4/7: Larger chick mercury sampled, 4/28 other large branchlings in general area; 5/4: Chick looks lively" +2023,little_d,180,greg,2023-03-03,2,,incubating,"2/24: GREG nest, small eggs, 3/17: chick hatching out of egg now 4/7: Larger chick mercury sampled, 4/28 other large branchlings in general area; 5/4: Chick looks lively" +2023,little_d,180,greg,2023-03-10,2,,incubating,"2/24: GREG nest, small eggs, 3/17: chick hatching out of egg now 4/7: Larger chick mercury sampled, 4/28 other large branchlings in general area; 5/4: Chick looks lively" +2023,little_d,180,greg,2023-03-17,,2,wet_chick,"2/24: GREG nest, small eggs, 3/17: chick hatching out of egg now 4/7: Larger chick mercury sampled, 4/28 other large branchlings in general area; 5/4: Chick looks lively" +2023,little_d,180,greg,2023-03-24,,2,nestling,"2/24: GREG nest, small eggs, 3/17: chick hatching out of egg now 4/7: Larger chick mercury sampled, 4/28 other large branchlings in general area; 5/4: Chick looks lively" +2023,little_d,180,greg,2023-03-31,,2,nestling,"2/24: GREG nest, small eggs, 3/17: chick hatching out of egg now 4/7: Larger chick mercury sampled, 4/28 other large branchlings in general area; 5/4: Chick looks lively" +2023,little_d,180,greg,2023-04-07,,2,nestling,"2/24: GREG nest, small eggs, 3/17: chick hatching out of egg now 4/7: Larger chick mercury sampled, 4/28 other large branchlings in general area; 5/4: Chick looks lively" +2023,little_d,180,greg,2023-04-14,,2,nestling,"2/24: GREG nest, small eggs, 3/17: chick hatching out of egg now 4/7: Larger chick mercury sampled, 4/28 other large branchlings in general area; 5/4: Chick looks lively" +2023,little_d,180,greg,2023-04-21,,1,nestling,"2/24: GREG nest, small eggs, 3/17: chick hatching out of egg now 4/7: Larger chick mercury sampled, 4/28 other large branchlings in general area; 5/4: Chick looks lively" +2023,little_d,180,greg,2023-04-28,,1,nestling,"2/24: GREG nest, small eggs, 3/17: chick hatching out of egg now 4/7: Larger chick mercury sampled, 4/28 other large branchlings in general area; 5/4: Chick looks lively" +2023,little_d,180,greg,2023-05-04,,1,branchling,"2/24: GREG nest, small eggs, 3/17: chick hatching out of egg now 4/7: Larger chick mercury sampled, 4/28 other large branchlings in general area; 5/4: Chick looks lively" +2023,little_d,180,greg,2023-05-11,,,,"2/24: GREG nest, small eggs, 3/17: chick hatching out of egg now 4/7: Larger chick mercury sampled, 4/28 other large branchlings in general area; 5/4: Chick looks lively" +2023,little_d,182,greg,2023-02-24,3,,incubating,"3/10: at least two chicks seen, a third was possible, 3/17: 3 chicks certain 4/7: 1 C+ 4/21: One large chick in death hunch in the nest" +2023,little_d,182,greg,2023-03-03,2,1,wet_chick,"3/10: at least two chicks seen, a third was possible, 3/17: 3 chicks certain 4/7: 1 C+ 4/21: One large chick in death hunch in the nest" +2023,little_d,182,greg,2023-03-10,,2,nestling,"3/10: at least two chicks seen, a third was possible, 3/17: 3 chicks certain 4/7: 1 C+ 4/21: One large chick in death hunch in the nest" +2023,little_d,182,greg,2023-03-17,,3,nestling,"3/10: at least two chicks seen, a third was possible, 3/17: 3 chicks certain 4/7: 1 C+ 4/21: One large chick in death hunch in the nest" +2023,little_d,182,greg,2023-03-24,,2,nestling,"3/10: at least two chicks seen, a third was possible, 3/17: 3 chicks certain 4/7: 1 C+ 4/21: One large chick in death hunch in the nest" +2023,little_d,182,greg,2023-03-31,,2,nestling,"3/10: at least two chicks seen, a third was possible, 3/17: 3 chicks certain 4/7: 1 C+ 4/21: One large chick in death hunch in the nest" +2023,little_d,182,greg,2023-04-07,,1,nestling,"3/10: at least two chicks seen, a third was possible, 3/17: 3 chicks certain 4/7: 1 C+ 4/21: One large chick in death hunch in the nest" +2023,little_d,182,greg,2023-04-14,,,empty,"3/10: at least two chicks seen, a third was possible, 3/17: 3 chicks certain 4/7: 1 C+ 4/21: One large chick in death hunch in the nest" +2023,little_d,182,greg,2023-04-21,,1,nestling,"3/10: at least two chicks seen, a third was possible, 3/17: 3 chicks certain 4/7: 1 C+ 4/21: One large chick in death hunch in the nest" +2023,little_d,182,greg,2023-04-28,,,empty,"3/10: at least two chicks seen, a third was possible, 3/17: 3 chicks certain 4/7: 1 C+ 4/21: One large chick in death hunch in the nest" +2023,little_d,182,greg,2023-05-04,,,,"3/10: at least two chicks seen, a third was possible, 3/17: 3 chicks certain 4/7: 1 C+ 4/21: One large chick in death hunch in the nest" +2023,little_d,182,greg,2023-05-11,,,,"3/10: at least two chicks seen, a third was possible, 3/17: 3 chicks certain 4/7: 1 C+ 4/21: One large chick in death hunch in the nest" +2023,little_d,337,greg,2023-02-24,,,,"3/24: chick wet, 1 egg pipping 4/7: 2 C certain 4/21: 1C+, 2 chicks in 337 area but one could've been 180 chick on the run; 5/4: Chick looks really sad" +2023,little_d,337,greg,2023-03-03,3,,incubating,"3/24: chick wet, 1 egg pipping 4/7: 2 C certain 4/21: 1C+, 2 chicks in 337 area but one could've been 180 chick on the run; 5/4: Chick looks really sad" +2023,little_d,337,greg,2023-03-10,3,,incubating,"3/24: chick wet, 1 egg pipping 4/7: 2 C certain 4/21: 1C+, 2 chicks in 337 area but one could've been 180 chick on the run; 5/4: Chick looks really sad" +2023,little_d,337,greg,2023-03-17,3,,incubating,"3/24: chick wet, 1 egg pipping 4/7: 2 C certain 4/21: 1C+, 2 chicks in 337 area but one could've been 180 chick on the run; 5/4: Chick looks really sad" +2023,little_d,337,greg,2023-03-24,2,1,wet_chick,"3/24: chick wet, 1 egg pipping 4/7: 2 C certain 4/21: 1C+, 2 chicks in 337 area but one could've been 180 chick on the run; 5/4: Chick looks really sad" +2023,little_d,337,greg,2023-03-31,,3,chick_dry,"3/24: chick wet, 1 egg pipping 4/7: 2 C certain 4/21: 1C+, 2 chicks in 337 area but one could've been 180 chick on the run; 5/4: Chick looks really sad" +2023,little_d,337,greg,2023-04-07,,2,nestling,"3/24: chick wet, 1 egg pipping 4/7: 2 C certain 4/21: 1C+, 2 chicks in 337 area but one could've been 180 chick on the run; 5/4: Chick looks really sad" +2023,little_d,337,greg,2023-04-14,,2,nestling,"3/24: chick wet, 1 egg pipping 4/7: 2 C certain 4/21: 1C+, 2 chicks in 337 area but one could've been 180 chick on the run; 5/4: Chick looks really sad" +2023,little_d,337,greg,2023-04-21,,1,branchling,"3/24: chick wet, 1 egg pipping 4/7: 2 C certain 4/21: 1C+, 2 chicks in 337 area but one could've been 180 chick on the run; 5/4: Chick looks really sad" +2023,little_d,337,greg,2023-04-28,,1,nestling,"3/24: chick wet, 1 egg pipping 4/7: 2 C certain 4/21: 1C+, 2 chicks in 337 area but one could've been 180 chick on the run; 5/4: Chick looks really sad" +2023,little_d,337,greg,2023-05-04,,1,nestling,"3/24: chick wet, 1 egg pipping 4/7: 2 C certain 4/21: 1C+, 2 chicks in 337 area but one could've been 180 chick on the run; 5/4: Chick looks really sad" +2023,little_d,337,greg,2023-05-11,,,,"3/24: chick wet, 1 egg pipping 4/7: 2 C certain 4/21: 1C+, 2 chicks in 337 area but one could've been 180 chick on the run; 5/4: Chick looks really sad" +2023,little_d,339,greg,2023-02-24,,,,"3/24: 1 dead chick; 3/31: two dead chicks 4/7: nest gone, flag pulled" +2023,little_d,339,greg,2023-03-03,2,,incubating,"3/24: 1 dead chick; 3/31: two dead chicks 4/7: nest gone, flag pulled" +2023,little_d,339,greg,2023-03-10,3,,incubating,"3/24: 1 dead chick; 3/31: two dead chicks 4/7: nest gone, flag pulled" +2023,little_d,339,greg,2023-03-17,2,,incubating,"3/24: 1 dead chick; 3/31: two dead chicks 4/7: nest gone, flag pulled" +2023,little_d,339,greg,2023-03-24,,1,nestling,"3/24: 1 dead chick; 3/31: two dead chicks 4/7: nest gone, flag pulled" +2023,little_d,339,greg,2023-03-31,,,empty,"3/24: 1 dead chick; 3/31: two dead chicks 4/7: nest gone, flag pulled" +2023,little_d,339,greg,2023-04-07,,,pulled,"3/24: 1 dead chick; 3/31: two dead chicks 4/7: nest gone, flag pulled" +2023,little_d,339,greg,2023-04-14,,,,"3/24: 1 dead chick; 3/31: two dead chicks 4/7: nest gone, flag pulled" +2023,little_d,339,greg,2023-04-21,,,,"3/24: 1 dead chick; 3/31: two dead chicks 4/7: nest gone, flag pulled" +2023,little_d,339,greg,2023-04-28,,,,"3/24: 1 dead chick; 3/31: two dead chicks 4/7: nest gone, flag pulled" +2023,little_d,339,greg,2023-05-04,,,,"3/24: 1 dead chick; 3/31: two dead chicks 4/7: nest gone, flag pulled" +2023,little_d,339,greg,2023-05-11,,,,"3/24: 1 dead chick; 3/31: two dead chicks 4/7: nest gone, flag pulled" +2023,little_d,213,greg,2023-02-24,2,,incubating,"4/7: 3 C certain 4/21: 1 branchling above nest, and one old dead chick, 4/28 branchling above" +2023,little_d,213,greg,2023-03-03,3,,incubating,"4/7: 3 C certain 4/21: 1 branchling above nest, and one old dead chick, 4/28 branchling above" +2023,little_d,213,greg,2023-03-10,3,,incubating,"4/7: 3 C certain 4/21: 1 branchling above nest, and one old dead chick, 4/28 branchling above" +2023,little_d,213,greg,2023-03-17,3,,incubating,"4/7: 3 C certain 4/21: 1 branchling above nest, and one old dead chick, 4/28 branchling above" +2023,little_d,213,greg,2023-03-24,,3,nestling,"4/7: 3 C certain 4/21: 1 branchling above nest, and one old dead chick, 4/28 branchling above" +2023,little_d,213,greg,2023-03-31,,3,nestling,"4/7: 3 C certain 4/21: 1 branchling above nest, and one old dead chick, 4/28 branchling above" +2023,little_d,213,greg,2023-04-07,,3,nestling,"4/7: 3 C certain 4/21: 1 branchling above nest, and one old dead chick, 4/28 branchling above" +2023,little_d,213,greg,2023-04-14,,2,nestling,"4/7: 3 C certain 4/21: 1 branchling above nest, and one old dead chick, 4/28 branchling above" +2023,little_d,213,greg,2023-04-21,,1,branchling,"4/7: 3 C certain 4/21: 1 branchling above nest, and one old dead chick, 4/28 branchling above" +2023,little_d,213,greg,2023-04-28,,,empty,"4/7: 3 C certain 4/21: 1 branchling above nest, and one old dead chick, 4/28 branchling above" +2023,little_d,213,greg,2023-05-04,,,pulled,"4/7: 3 C certain 4/21: 1 branchling above nest, and one old dead chick, 4/28 branchling above" +2023,little_d,213,greg,2023-05-11,,,,"4/7: 3 C certain 4/21: 1 branchling above nest, and one old dead chick, 4/28 branchling above" +2023,little_d,184,greg,2023-02-24,3,,incubating, +2023,little_d,184,greg,2023-03-03,3,,incubating, +2023,little_d,184,greg,2023-03-10,3,,incubating, +2023,little_d,184,greg,2023-03-17,1,2,hatching, +2023,little_d,184,greg,2023-03-24,,3,nestling, +2023,little_d,184,greg,2023-03-31,,3,nestling, +2023,little_d,184,greg,2023-04-07,,2,nestling, +2023,little_d,184,greg,2023-04-14,,,empty, +2023,little_d,184,greg,2023-04-21,,,empty, +2023,little_d,184,greg,2023-04-28,,,pulled, +2023,little_d,184,greg,2023-05-04,,,, +2023,little_d,184,greg,2023-05-11,,,, +2023,little_d,186,greg,2023-02-24,3,,incubating,"3/10: nest gone, eggshells on the ground. Pulled flagging" +2023,little_d,186,greg,2023-03-03,3,,incubating,"3/10: nest gone, eggshells on the ground. Pulled flagging" +2023,little_d,186,greg,2023-03-10,,,empty,"3/10: nest gone, eggshells on the ground. Pulled flagging" +2023,little_d,186,greg,2023-03-17,,,,"3/10: nest gone, eggshells on the ground. Pulled flagging" +2023,little_d,186,greg,2023-03-24,,,,"3/10: nest gone, eggshells on the ground. Pulled flagging" +2023,little_d,186,greg,2023-03-31,,,,"3/10: nest gone, eggshells on the ground. Pulled flagging" +2023,little_d,186,greg,2023-04-07,,,,"3/10: nest gone, eggshells on the ground. Pulled flagging" +2023,little_d,186,greg,2023-04-14,,,,"3/10: nest gone, eggshells on the ground. Pulled flagging" +2023,little_d,186,greg,2023-04-21,,,,"3/10: nest gone, eggshells on the ground. Pulled flagging" +2023,little_d,186,greg,2023-04-28,,,,"3/10: nest gone, eggshells on the ground. Pulled flagging" +2023,little_d,186,greg,2023-05-04,,,,"3/10: nest gone, eggshells on the ground. Pulled flagging" +2023,little_d,186,greg,2023-05-11,,,,"3/10: nest gone, eggshells on the ground. Pulled flagging" +2023,little_d,188,greg,2023-02-24,3,,incubating,"3/24: 1 dead chick 4/7: 2 C certain 4/21: 1 dead chick about 1 foot from nest, no other nests immediately nearby" +2023,little_d,188,greg,2023-03-03,3,,incubating,"3/24: 1 dead chick 4/7: 2 C certain 4/21: 1 dead chick about 1 foot from nest, no other nests immediately nearby" +2023,little_d,188,greg,2023-03-10,3,,incubating,"3/24: 1 dead chick 4/7: 2 C certain 4/21: 1 dead chick about 1 foot from nest, no other nests immediately nearby" +2023,little_d,188,greg,2023-03-17,,3,nestling,"3/24: 1 dead chick 4/7: 2 C certain 4/21: 1 dead chick about 1 foot from nest, no other nests immediately nearby" +2023,little_d,188,greg,2023-03-24,,2,nestling,"3/24: 1 dead chick 4/7: 2 C certain 4/21: 1 dead chick about 1 foot from nest, no other nests immediately nearby" +2023,little_d,188,greg,2023-03-31,,2,nestling,"3/24: 1 dead chick 4/7: 2 C certain 4/21: 1 dead chick about 1 foot from nest, no other nests immediately nearby" +2023,little_d,188,greg,2023-04-07,,2,nestling,"3/24: 1 dead chick 4/7: 2 C certain 4/21: 1 dead chick about 1 foot from nest, no other nests immediately nearby" +2023,little_d,188,greg,2023-04-14,,1,nestling,"3/24: 1 dead chick 4/7: 2 C certain 4/21: 1 dead chick about 1 foot from nest, no other nests immediately nearby" +2023,little_d,188,greg,2023-04-21,,,empty,"3/24: 1 dead chick 4/7: 2 C certain 4/21: 1 dead chick about 1 foot from nest, no other nests immediately nearby" +2023,little_d,188,greg,2023-04-28,,,pulled,"3/24: 1 dead chick 4/7: 2 C certain 4/21: 1 dead chick about 1 foot from nest, no other nests immediately nearby" +2023,little_d,188,greg,2023-05-04,,,,"3/24: 1 dead chick 4/7: 2 C certain 4/21: 1 dead chick about 1 foot from nest, no other nests immediately nearby" +2023,little_d,188,greg,2023-05-11,,,,"3/24: 1 dead chick 4/7: 2 C certain 4/21: 1 dead chick about 1 foot from nest, no other nests immediately nearby" +2023,little_d,341,greg,2023-02-24,,,,"3/3: high, directly above 339 3/24: nest partially collapsed" +2023,little_d,341,greg,2023-03-03,1,,incubating,"3/3: high, directly above 339 3/24: nest partially collapsed" +2023,little_d,341,greg,2023-03-10,2,,incubating,"3/3: high, directly above 339 3/24: nest partially collapsed" +2023,little_d,341,greg,2023-03-17,3,,incubating,"3/3: high, directly above 339 3/24: nest partially collapsed" +2023,little_d,341,greg,2023-03-24,,,empty,"3/3: high, directly above 339 3/24: nest partially collapsed" +2023,little_d,341,greg,2023-03-31,,,,"3/3: high, directly above 339 3/24: nest partially collapsed" +2023,little_d,341,greg,2023-04-07,,,pulled,"3/3: high, directly above 339 3/24: nest partially collapsed" +2023,little_d,341,greg,2023-04-14,,,,"3/3: high, directly above 339 3/24: nest partially collapsed" +2023,little_d,341,greg,2023-04-21,,,,"3/3: high, directly above 339 3/24: nest partially collapsed" +2023,little_d,341,greg,2023-04-28,,,,"3/3: high, directly above 339 3/24: nest partially collapsed" +2023,little_d,341,greg,2023-05-04,,,,"3/3: high, directly above 339 3/24: nest partially collapsed" +2023,little_d,341,greg,2023-05-11,,,,"3/3: high, directly above 339 3/24: nest partially collapsed" +2023,little_d,396,greg,2023-02-24,,,,"4/21: 2 big chicks in canopy in general area of 211 and 396" +2023,little_d,396,greg,2023-03-03,,,,"4/21: 2 big chicks in canopy in general area of 211 and 396" +2023,little_d,396,greg,2023-03-10,1,,incubating,"4/21: 2 big chicks in canopy in general area of 211 and 396" +2023,little_d,396,greg,2023-03-17,3,,incubating,"4/21: 2 big chicks in canopy in general area of 211 and 396" +2023,little_d,396,greg,2023-03-24,3,,incubating,"4/21: 2 big chicks in canopy in general area of 211 and 396" +2023,little_d,396,greg,2023-03-31,,,empty,"4/21: 2 big chicks in canopy in general area of 211 and 396" +2023,little_d,396,greg,2023-04-07,,,empty,"4/21: 2 big chicks in canopy in general area of 211 and 396" +2023,little_d,396,greg,2023-04-14,,,empty,"4/21: 2 big chicks in canopy in general area of 211 and 396" +2023,little_d,396,greg,2023-04-21,,,empty,"4/21: 2 big chicks in canopy in general area of 211 and 396" +2023,little_d,396,greg,2023-04-28,,,pulled,"4/21: 2 big chicks in canopy in general area of 211 and 396" +2023,little_d,396,greg,2023-05-04,,,,"4/21: 2 big chicks in canopy in general area of 211 and 396" +2023,little_d,396,greg,2023-05-11,,,,"4/21: 2 big chicks in canopy in general area of 211 and 396" +2023,little_d,505,greg,2023-02-24,,,,"3/24: 1 small dead chick below nest; 3/31: partially gone" +2023,little_d,505,greg,2023-03-03,,,,"3/24: 1 small dead chick below nest; 3/31: partially gone" +2023,little_d,505,greg,2023-03-10,,,,"3/24: 1 small dead chick below nest; 3/31: partially gone" +2023,little_d,505,greg,2023-03-17,3,,incubating,"3/24: 1 small dead chick below nest; 3/31: partially gone" +2023,little_d,505,greg,2023-03-24,1,1,wet_chick,"3/24: 1 small dead chick below nest; 3/31: partially gone" +2023,little_d,505,greg,2023-03-31,,,empty,"3/24: 1 small dead chick below nest; 3/31: partially gone" +2023,little_d,505,greg,2023-04-07,,,pulled,"3/24: 1 small dead chick below nest; 3/31: partially gone" +2023,little_d,505,greg,2023-04-14,,,,"3/24: 1 small dead chick below nest; 3/31: partially gone" +2023,little_d,505,greg,2023-04-21,,,,"3/24: 1 small dead chick below nest; 3/31: partially gone" +2023,little_d,505,greg,2023-04-28,,,,"3/24: 1 small dead chick below nest; 3/31: partially gone" +2023,little_d,505,greg,2023-05-04,,,,"3/24: 1 small dead chick below nest; 3/31: partially gone" +2023,little_d,505,greg,2023-05-11,,,,"3/24: 1 small dead chick below nest; 3/31: partially gone" +2023,little_d,215,greg,2023-02-24,3,,incubating,"3/17: egg is pipping 4/21: 2 branchlings in general area, plus one dead chick below the nest (unknown origin with several other nests around), 4/28: dead chick hanging from canopy nearby; 2 branchlings in area between 215, 217, and 219" +2023,little_d,215,greg,2023-03-03,3,,incubating,"3/17: egg is pipping 4/21: 2 branchlings in general area, plus one dead chick below the nest (unknown origin with several other nests around), 4/28: dead chick hanging from canopy nearby; 2 branchlings in area between 215, 217, and 219" +2023,little_d,215,greg,2023-03-10,3,,incubating,"3/17: egg is pipping 4/21: 2 branchlings in general area, plus one dead chick below the nest (unknown origin with several other nests around), 4/28: dead chick hanging from canopy nearby; 2 branchlings in area between 215, 217, and 219" +2023,little_d,215,greg,2023-03-17,2,1,pipping,"3/17: egg is pipping 4/21: 2 branchlings in general area, plus one dead chick below the nest (unknown origin with several other nests around), 4/28: dead chick hanging from canopy nearby; 2 branchlings in area between 215, 217, and 219" +2023,little_d,215,greg,2023-03-24,,3,nestling,"3/17: egg is pipping 4/21: 2 branchlings in general area, plus one dead chick below the nest (unknown origin with several other nests around), 4/28: dead chick hanging from canopy nearby; 2 branchlings in area between 215, 217, and 219" +2023,little_d,215,greg,2023-03-31,,2,nestling,"3/17: egg is pipping 4/21: 2 branchlings in general area, plus one dead chick below the nest (unknown origin with several other nests around), 4/28: dead chick hanging from canopy nearby; 2 branchlings in area between 215, 217, and 219" +2023,little_d,215,greg,2023-04-07,,2,nestling,"3/17: egg is pipping 4/21: 2 branchlings in general area, plus one dead chick below the nest (unknown origin with several other nests around), 4/28: dead chick hanging from canopy nearby; 2 branchlings in area between 215, 217, and 219" +2023,little_d,215,greg,2023-04-14,,2,nestling,"3/17: egg is pipping 4/21: 2 branchlings in general area, plus one dead chick below the nest (unknown origin with several other nests around), 4/28: dead chick hanging from canopy nearby; 2 branchlings in area between 215, 217, and 219" +2023,little_d,215,greg,2023-04-21,,,empty,"3/17: egg is pipping 4/21: 2 branchlings in general area, plus one dead chick below the nest (unknown origin with several other nests around), 4/28: dead chick hanging from canopy nearby; 2 branchlings in area between 215, 217, and 219" +2023,little_d,215,greg,2023-04-28,,,empty,"3/17: egg is pipping 4/21: 2 branchlings in general area, plus one dead chick below the nest (unknown origin with several other nests around), 4/28: dead chick hanging from canopy nearby; 2 branchlings in area between 215, 217, and 219" +2023,little_d,215,greg,2023-05-04,,,pulled,"3/17: egg is pipping 4/21: 2 branchlings in general area, plus one dead chick below the nest (unknown origin with several other nests around), 4/28: dead chick hanging from canopy nearby; 2 branchlings in area between 215, 217, and 219" +2023,little_d,215,greg,2023-05-11,,,,"3/17: egg is pipping 4/21: 2 branchlings in general area, plus one dead chick below the nest (unknown origin with several other nests around), 4/28: dead chick hanging from canopy nearby; 2 branchlings in area between 215, 217, and 219" +2023,little_d,326,greg,2023-02-24,,,,"4/28: Big branchling above" +2023,little_d,326,greg,2023-03-03,3,,incubating,"4/28: Big branchling above" +2023,little_d,326,greg,2023-03-10,3,,incubating,"4/28: Big branchling above" +2023,little_d,326,greg,2023-03-17,1,2,wet_chick,"4/28: Big branchling above" +2023,little_d,326,greg,2023-03-24,,3,nestling,"4/28: Big branchling above" +2023,little_d,326,greg,2023-03-31,,2,nestling,"4/28: Big branchling above" +2023,little_d,326,greg,2023-04-07,,2,nestling,"4/28: Big branchling above" +2023,little_d,326,greg,2023-04-14,,2,nestling,"4/28: Big branchling above" +2023,little_d,326,greg,2023-04-21,,2,nestling,"4/28: Big branchling above" +2023,little_d,326,greg,2023-04-28,,,empty,"4/28: Big branchling above" +2023,little_d,326,greg,2023-05-04,,,pulled,"4/28: Big branchling above" +2023,little_d,326,greg,2023-05-11,,,,"4/28: Big branchling above" +2023,little_d,398,greg,2023-02-24,,,,"3/17: certain 3 chicks" +2023,little_d,398,greg,2023-03-03,,,,"3/17: certain 3 chicks" +2023,little_d,398,greg,2023-03-10,3,,incubating,"3/17: certain 3 chicks" +2023,little_d,398,greg,2023-03-17,,3,nestling,"3/17: certain 3 chicks" +2023,little_d,398,greg,2023-03-24,,3,nestling,"3/17: certain 3 chicks" +2023,little_d,398,greg,2023-03-31,,2,nestling,"3/17: certain 3 chicks" +2023,little_d,398,greg,2023-04-07,,2,nestling,"3/17: certain 3 chicks" +2023,little_d,398,greg,2023-04-14,,2,nestling,"3/17: certain 3 chicks" +2023,little_d,398,greg,2023-04-21,,,empty,"3/17: certain 3 chicks" +2023,little_d,398,greg,2023-04-28,,,pulled,"3/17: certain 3 chicks" +2023,little_d,398,greg,2023-05-04,,,,"3/17: certain 3 chicks" +2023,little_d,398,greg,2023-05-11,,,,"3/17: certain 3 chicks" +2023,little_d,190,greg,2023-02-24,2,,incubating,"3/10: nest gone, eggshell on ground, pulled flagging" +2023,little_d,190,greg,2023-03-03,2,,incubating,"3/10: nest gone, eggshell on ground, pulled flagging" +2023,little_d,190,greg,2023-03-10,,,empty,"3/10: nest gone, eggshell on ground, pulled flagging" +2023,little_d,190,greg,2023-03-17,,,,"3/10: nest gone, eggshell on ground, pulled flagging" +2023,little_d,190,greg,2023-03-24,,,,"3/10: nest gone, eggshell on ground, pulled flagging" +2023,little_d,190,greg,2023-03-31,,,,"3/10: nest gone, eggshell on ground, pulled flagging" +2023,little_d,190,greg,2023-04-07,,,,"3/10: nest gone, eggshell on ground, pulled flagging" +2023,little_d,190,greg,2023-04-14,,,,"3/10: nest gone, eggshell on ground, pulled flagging" +2023,little_d,190,greg,2023-04-21,,,,"3/10: nest gone, eggshell on ground, pulled flagging" +2023,little_d,190,greg,2023-04-28,,,,"3/10: nest gone, eggshell on ground, pulled flagging" +2023,little_d,190,greg,2023-05-04,,,,"3/10: nest gone, eggshell on ground, pulled flagging" +2023,little_d,190,greg,2023-05-11,,,,"3/10: nest gone, eggshell on ground, pulled flagging" +2023,little_d,192,greg,2023-02-24,2,,incubating,"3/10: smaller chick slightly damp still 4/21: large dead chick in nest, sampled for mercury, +one large chick in canopy" +2023,little_d,192,greg,2023-03-03,2,,incubating,"3/10: smaller chick slightly damp still 4/21: large dead chick in nest, sampled for mercury, +one large chick in canopy" +2023,little_d,192,greg,2023-03-10,,2,nestling,"3/10: smaller chick slightly damp still 4/21: large dead chick in nest, sampled for mercury, +one large chick in canopy" +2023,little_d,192,greg,2023-03-17,,2,nestling,"3/10: smaller chick slightly damp still 4/21: large dead chick in nest, sampled for mercury, +one large chick in canopy" +2023,little_d,192,greg,2023-03-24,,2,nestling,"3/10: smaller chick slightly damp still 4/21: large dead chick in nest, sampled for mercury, +one large chick in canopy" +2023,little_d,192,greg,2023-03-31,,2,nestling,"3/10: smaller chick slightly damp still 4/21: large dead chick in nest, sampled for mercury, +one large chick in canopy" +2023,little_d,192,greg,2023-04-07,,2,nestling,"3/10: smaller chick slightly damp still 4/21: large dead chick in nest, sampled for mercury, +one large chick in canopy" +2023,little_d,192,greg,2023-04-14,,2,nestling,"3/10: smaller chick slightly damp still 4/21: large dead chick in nest, sampled for mercury, +one large chick in canopy" +2023,little_d,192,greg,2023-04-21,,1,branchling,"3/10: smaller chick slightly damp still 4/21: large dead chick in nest, sampled for mercury, +one large chick in canopy" +2023,little_d,192,greg,2023-04-28,,,pulled,"3/10: smaller chick slightly damp still 4/21: large dead chick in nest, sampled for mercury, +one large chick in canopy" +2023,little_d,192,greg,2023-05-04,,,,"3/10: smaller chick slightly damp still 4/21: large dead chick in nest, sampled for mercury, +one large chick in canopy" +2023,little_d,192,greg,2023-05-11,,,,"3/10: smaller chick slightly damp still 4/21: large dead chick in nest, sampled for mercury, +one large chick in canopy" +2023,little_d,507,greg,2023-02-24,,,, +2023,little_d,507,greg,2023-03-03,,,, +2023,little_d,507,greg,2023-03-10,,,, +2023,little_d,507,greg,2023-03-17,3,,incubating, +2023,little_d,507,greg,2023-03-24,,,empty, +2023,little_d,507,greg,2023-03-31,,,, +2023,little_d,507,greg,2023-04-07,,,pulled, +2023,little_d,507,greg,2023-04-14,,,, +2023,little_d,507,greg,2023-04-21,,,, +2023,little_d,507,greg,2023-04-28,,,, +2023,little_d,507,greg,2023-05-04,,,, +2023,little_d,507,greg,2023-05-11,,,, +2023,little_d,217,greg,2023-02-24,2,,incubating,"4/21: several branchlings around, 4/28: 2 branchlings in area between 215, 217, and 219; 5/4: Flag pulled" +2023,little_d,217,greg,2023-03-03,2,,incubating,"4/21: several branchlings around, 4/28: 2 branchlings in area between 215, 217, and 219; 5/4: Flag pulled" +2023,little_d,217,greg,2023-03-10,,2,chick_dry,"4/21: several branchlings around, 4/28: 2 branchlings in area between 215, 217, and 219; 5/4: Flag pulled" +2023,little_d,217,greg,2023-03-17,,2,nestling,"4/21: several branchlings around, 4/28: 2 branchlings in area between 215, 217, and 219; 5/4: Flag pulled" +2023,little_d,217,greg,2023-03-24,,2,nestling,"4/21: several branchlings around, 4/28: 2 branchlings in area between 215, 217, and 219; 5/4: Flag pulled" +2023,little_d,217,greg,2023-03-31,,1,nestling,"4/21: several branchlings around, 4/28: 2 branchlings in area between 215, 217, and 219; 5/4: Flag pulled" +2023,little_d,217,greg,2023-04-07,,1,nestling,"4/21: several branchlings around, 4/28: 2 branchlings in area between 215, 217, and 219; 5/4: Flag pulled" +2023,little_d,217,greg,2023-04-14,,1,nestling,"4/21: several branchlings around, 4/28: 2 branchlings in area between 215, 217, and 219; 5/4: Flag pulled" +2023,little_d,217,greg,2023-04-21,,,empty,"4/21: several branchlings around, 4/28: 2 branchlings in area between 215, 217, and 219; 5/4: Flag pulled" +2023,little_d,217,greg,2023-04-28,,,empty,"4/21: several branchlings around, 4/28: 2 branchlings in area between 215, 217, and 219; 5/4: Flag pulled" +2023,little_d,217,greg,2023-05-04,,,empty,"4/21: several branchlings around, 4/28: 2 branchlings in area between 215, 217, and 219; 5/4: Flag pulled" +2023,little_d,217,greg,2023-05-11,,,,"4/21: several branchlings around, 4/28: 2 branchlings in area between 215, 217, and 219; 5/4: Flag pulled" +2023,little_d,219,greg,2023-02-24,3,,incubating,"4/14: sampled for mercury, 4/28: 2 branchlings in area between 215, 217, and 219" +2023,little_d,219,greg,2023-03-03,3,,incubating,"4/14: sampled for mercury, 4/28: 2 branchlings in area between 215, 217, and 219" +2023,little_d,219,greg,2023-03-10,3,,incubating,"4/14: sampled for mercury, 4/28: 2 branchlings in area between 215, 217, and 219" +2023,little_d,219,greg,2023-03-17,1,2,chick_dry,"4/14: sampled for mercury, 4/28: 2 branchlings in area between 215, 217, and 219" +2023,little_d,219,greg,2023-03-24,,3,nestling,"4/14: sampled for mercury, 4/28: 2 branchlings in area between 215, 217, and 219" +2023,little_d,219,greg,2023-03-31,,2,nestling,"4/14: sampled for mercury, 4/28: 2 branchlings in area between 215, 217, and 219" +2023,little_d,219,greg,2023-04-07,,2,nestling,"4/14: sampled for mercury, 4/28: 2 branchlings in area between 215, 217, and 219" +2023,little_d,219,greg,2023-04-14,,1,nestling,"4/14: sampled for mercury, 4/28: 2 branchlings in area between 215, 217, and 219" +2023,little_d,219,greg,2023-04-21,,1,branchling,"4/14: sampled for mercury, 4/28: 2 branchlings in area between 215, 217, and 219" +2023,little_d,219,greg,2023-04-28,,,empty,"4/14: sampled for mercury, 4/28: 2 branchlings in area between 215, 217, and 219" +2023,little_d,219,greg,2023-05-04,,,pulled,"4/14: sampled for mercury, 4/28: 2 branchlings in area between 215, 217, and 219" +2023,little_d,219,greg,2023-05-11,,,,"4/14: sampled for mercury, 4/28: 2 branchlings in area between 215, 217, and 219" +2023,little_d,308,greg,2023-02-24,,,,"3/3 view from log on trail, far reach; 4/14: 2+ chicks; 4/28:1C+; 5/4: Flag pulled" +2023,little_d,308,greg,2023-03-03,3,,incubating,"3/3 view from log on trail, far reach; 4/14: 2+ chicks; 4/28:1C+; 5/4: Flag pulled" +2023,little_d,308,greg,2023-03-10,3,,incubating,"3/3 view from log on trail, far reach; 4/14: 2+ chicks; 4/28:1C+; 5/4: Flag pulled" +2023,little_d,308,greg,2023-03-17,3,,incubating,"3/3 view from log on trail, far reach; 4/14: 2+ chicks; 4/28:1C+; 5/4: Flag pulled" +2023,little_d,308,greg,2023-03-24,3,,incubating,"3/3 view from log on trail, far reach; 4/14: 2+ chicks; 4/28:1C+; 5/4: Flag pulled" +2023,little_d,308,greg,2023-03-31,,3,nestling,"3/3 view from log on trail, far reach; 4/14: 2+ chicks; 4/28:1C+; 5/4: Flag pulled" +2023,little_d,308,greg,2023-04-07,,3,nestling,"3/3 view from log on trail, far reach; 4/14: 2+ chicks; 4/28:1C+; 5/4: Flag pulled" +2023,little_d,308,greg,2023-04-14,,2,nestling,"3/3 view from log on trail, far reach; 4/14: 2+ chicks; 4/28:1C+; 5/4: Flag pulled" +2023,little_d,308,greg,2023-04-21,,2,nestling,"3/3 view from log on trail, far reach; 4/14: 2+ chicks; 4/28:1C+; 5/4: Flag pulled" +2023,little_d,308,greg,2023-04-28,,1,branchling,"3/3 view from log on trail, far reach; 4/14: 2+ chicks; 4/28:1C+; 5/4: Flag pulled" +2023,little_d,308,greg,2023-05-04,,,empty,"3/3 view from log on trail, far reach; 4/14: 2+ chicks; 4/28:1C+; 5/4: Flag pulled" +2023,little_d,308,greg,2023-05-11,,,,"3/3 view from log on trail, far reach; 4/14: 2+ chicks; 4/28:1C+; 5/4: Flag pulled" +2023,little_d,194,greg,2023-02-24,3,,incubating,"3/17: hatching now, chick wet 4/21: one chick above nest" +2023,little_d,194,greg,2023-03-03,3,,incubating,"3/17: hatching now, chick wet 4/21: one chick above nest" +2023,little_d,194,greg,2023-03-10,3,,incubating,"3/17: hatching now, chick wet 4/21: one chick above nest" +2023,little_d,194,greg,2023-03-17,2,1,wet_chick,"3/17: hatching now, chick wet 4/21: one chick above nest" +2023,little_d,194,greg,2023-03-24,,3,nestling,"3/17: hatching now, chick wet 4/21: one chick above nest" +2023,little_d,194,greg,2023-03-31,,2,nestling,"3/17: hatching now, chick wet 4/21: one chick above nest" +2023,little_d,194,greg,2023-04-07,,2,nestling,"3/17: hatching now, chick wet 4/21: one chick above nest" +2023,little_d,194,greg,2023-04-14,,2,nestling,"3/17: hatching now, chick wet 4/21: one chick above nest" +2023,little_d,194,greg,2023-04-21,,1,branchling,"3/17: hatching now, chick wet 4/21: one chick above nest" +2023,little_d,194,greg,2023-04-28,,,empty,"3/17: hatching now, chick wet 4/21: one chick above nest" +2023,little_d,194,greg,2023-05-04,,,pulled,"3/17: hatching now, chick wet 4/21: one chick above nest" +2023,little_d,194,greg,2023-05-11,,,,"3/17: hatching now, chick wet 4/21: one chick above nest" +2023,little_d,196,greg,2023-02-24,2,,incubating,"3/24: 1 egg pipping, 1 small dead chick on ground" +2023,little_d,196,greg,2023-03-03,3,,incubating,"3/24: 1 egg pipping, 1 small dead chick on ground" +2023,little_d,196,greg,2023-03-10,3,,incubating,"3/24: 1 egg pipping, 1 small dead chick on ground" +2023,little_d,196,greg,2023-03-17,3,,incubating,"3/24: 1 egg pipping, 1 small dead chick on ground" +2023,little_d,196,greg,2023-03-24,2,,pipping,"3/24: 1 egg pipping, 1 small dead chick on ground" +2023,little_d,196,greg,2023-03-31,,,empty,"3/24: 1 egg pipping, 1 small dead chick on ground" +2023,little_d,196,greg,2023-04-07,,,pulled,"3/24: 1 egg pipping, 1 small dead chick on ground" +2023,little_d,196,greg,2023-04-14,,,,"3/24: 1 egg pipping, 1 small dead chick on ground" +2023,little_d,196,greg,2023-04-21,,,,"3/24: 1 egg pipping, 1 small dead chick on ground" +2023,little_d,196,greg,2023-04-28,,,,"3/24: 1 egg pipping, 1 small dead chick on ground" +2023,little_d,196,greg,2023-05-04,,,,"3/24: 1 egg pipping, 1 small dead chick on ground" +2023,little_d,196,greg,2023-05-11,,,,"3/24: 1 egg pipping, 1 small dead chick on ground" +2023,little_d,221,greg,2023-02-24,3,,incubating,"3/17: certain of 3 chicks 3/24: 2 dead chicks hanging near nest; 3/31: flag pulled" +2023,little_d,221,greg,2023-03-03,3,,incubating,"3/17: certain of 3 chicks 3/24: 2 dead chicks hanging near nest; 3/31: flag pulled" +2023,little_d,221,greg,2023-03-10,2,1,wet_chick,"3/17: certain of 3 chicks 3/24: 2 dead chicks hanging near nest; 3/31: flag pulled" +2023,little_d,221,greg,2023-03-17,,3,nestling,"3/17: certain of 3 chicks 3/24: 2 dead chicks hanging near nest; 3/31: flag pulled" +2023,little_d,221,greg,2023-03-24,,,empty,"3/17: certain of 3 chicks 3/24: 2 dead chicks hanging near nest; 3/31: flag pulled" +2023,little_d,221,greg,2023-03-31,,,pulled,"3/17: certain of 3 chicks 3/24: 2 dead chicks hanging near nest; 3/31: flag pulled" +2023,little_d,221,greg,2023-04-07,,,,"3/17: certain of 3 chicks 3/24: 2 dead chicks hanging near nest; 3/31: flag pulled" +2023,little_d,221,greg,2023-04-14,,,,"3/17: certain of 3 chicks 3/24: 2 dead chicks hanging near nest; 3/31: flag pulled" +2023,little_d,221,greg,2023-04-21,,,,"3/17: certain of 3 chicks 3/24: 2 dead chicks hanging near nest; 3/31: flag pulled" +2023,little_d,221,greg,2023-04-28,,,,"3/17: certain of 3 chicks 3/24: 2 dead chicks hanging near nest; 3/31: flag pulled" +2023,little_d,221,greg,2023-05-04,,,,"3/17: certain of 3 chicks 3/24: 2 dead chicks hanging near nest; 3/31: flag pulled" +2023,little_d,221,greg,2023-05-11,,,,"3/17: certain of 3 chicks 3/24: 2 dead chicks hanging near nest; 3/31: flag pulled" +2023,little_d,198,greg,2023-02-24,3,,incubating,"4/14: sampled for mercury 4/21: 2 branchlings in 200/198 area" +2023,little_d,198,greg,2023-03-03,3,,incubating,"4/14: sampled for mercury 4/21: 2 branchlings in 200/198 area" +2023,little_d,198,greg,2023-03-10,3,,incubating,"4/14: sampled for mercury 4/21: 2 branchlings in 200/198 area" +2023,little_d,198,greg,2023-03-17,1,2,hatching,"4/14: sampled for mercury 4/21: 2 branchlings in 200/198 area" +2023,little_d,198,greg,2023-03-24,,3,nestling,"4/14: sampled for mercury 4/21: 2 branchlings in 200/198 area" +2023,little_d,198,greg,2023-03-31,,2,nestling,"4/14: sampled for mercury 4/21: 2 branchlings in 200/198 area" +2023,little_d,198,greg,2023-04-07,,2,nestling,"4/14: sampled for mercury 4/21: 2 branchlings in 200/198 area" +2023,little_d,198,greg,2023-04-14,,2,nestling,"4/14: sampled for mercury 4/21: 2 branchlings in 200/198 area" +2023,little_d,198,greg,2023-04-21,,,empty,"4/14: sampled for mercury 4/21: 2 branchlings in 200/198 area" +2023,little_d,198,greg,2023-04-28,,,empty,"4/14: sampled for mercury 4/21: 2 branchlings in 200/198 area" +2023,little_d,198,greg,2023-05-04,,,,"4/14: sampled for mercury 4/21: 2 branchlings in 200/198 area" +2023,little_d,198,greg,2023-05-11,,,,"4/14: sampled for mercury 4/21: 2 branchlings in 200/198 area" +2023,little_d,200,greg,2023-02-24,1,,incubating,"4/7: 1 C certain, chick small 4/21: 2 branchlings in 200/198 area; 4/28 dying chick in nest" +2023,little_d,200,greg,2023-03-03,3,,incubating,"4/7: 1 C certain, chick small 4/21: 2 branchlings in 200/198 area; 4/28 dying chick in nest" +2023,little_d,200,greg,2023-03-10,3,,incubating,"4/7: 1 C certain, chick small 4/21: 2 branchlings in 200/198 area; 4/28 dying chick in nest" +2023,little_d,200,greg,2023-03-17,3,,incubating,"4/7: 1 C certain, chick small 4/21: 2 branchlings in 200/198 area; 4/28 dying chick in nest" +2023,little_d,200,greg,2023-03-24,2,1,wet_chick,"4/7: 1 C certain, chick small 4/21: 2 branchlings in 200/198 area; 4/28 dying chick in nest" +2023,little_d,200,greg,2023-03-31,,2,nestling,"4/7: 1 C certain, chick small 4/21: 2 branchlings in 200/198 area; 4/28 dying chick in nest" +2023,little_d,200,greg,2023-04-07,,1,nestling,"4/7: 1 C certain, chick small 4/21: 2 branchlings in 200/198 area; 4/28 dying chick in nest" +2023,little_d,200,greg,2023-04-14,,,empty,"4/7: 1 C certain, chick small 4/21: 2 branchlings in 200/198 area; 4/28 dying chick in nest" +2023,little_d,200,greg,2023-04-21,,,empty,"4/7: 1 C certain, chick small 4/21: 2 branchlings in 200/198 area; 4/28 dying chick in nest" +2023,little_d,200,greg,2023-04-28,,,empty,"4/7: 1 C certain, chick small 4/21: 2 branchlings in 200/198 area; 4/28 dying chick in nest" +2023,little_d,200,greg,2023-05-04,,,pulled,"4/7: 1 C certain, chick small 4/21: 2 branchlings in 200/198 area; 4/28 dying chick in nest" +2023,little_d,200,greg,2023-05-11,,,,"4/7: 1 C certain, chick small 4/21: 2 branchlings in 200/198 area; 4/28 dying chick in nest" +2023,little_d,202,greg,2023-02-24,3,,incubating,"3/24: could only confirm 2 chicks" +2023,little_d,202,greg,2023-03-03,3,,incubating,"3/24: could only confirm 2 chicks" +2023,little_d,202,greg,2023-03-10,1,2,chick_dry,"3/24: could only confirm 2 chicks" +2023,little_d,202,greg,2023-03-17,,3,hatching,"3/24: could only confirm 2 chicks" +2023,little_d,202,greg,2023-03-24,,2,nestling,"3/24: could only confirm 2 chicks" +2023,little_d,202,greg,2023-03-31,,2,nestling,"3/24: could only confirm 2 chicks" +2023,little_d,202,greg,2023-04-07,,2,nestling,"3/24: could only confirm 2 chicks" +2023,little_d,202,greg,2023-04-14,,,empty,"3/24: could only confirm 2 chicks" +2023,little_d,202,greg,2023-04-21,,,empty,"3/24: could only confirm 2 chicks" +2023,little_d,202,greg,2023-04-28,,,empty,"3/24: could only confirm 2 chicks" +2023,little_d,202,greg,2023-05-04,,,pulled,"3/24: could only confirm 2 chicks" +2023,little_d,202,greg,2023-05-11,,,,"3/24: could only confirm 2 chicks" +2023,little_d,343,greg,2023-02-24,,,,"3/24: could only confirm 2 chicks 4/7: Smaller chick found on branch below the nest, mercury sampled and returned to nest 4/21: dead chick" +2023,little_d,343,greg,2023-03-03,3,,incubating,"3/24: could only confirm 2 chicks 4/7: Smaller chick found on branch below the nest, mercury sampled and returned to nest 4/21: dead chick" +2023,little_d,343,greg,2023-03-10,3,,incubating,"3/24: could only confirm 2 chicks 4/7: Smaller chick found on branch below the nest, mercury sampled and returned to nest 4/21: dead chick" +2023,little_d,343,greg,2023-03-17,,3,hatching,"3/24: could only confirm 2 chicks 4/7: Smaller chick found on branch below the nest, mercury sampled and returned to nest 4/21: dead chick" +2023,little_d,343,greg,2023-03-24,,2,nestling,"3/24: could only confirm 2 chicks 4/7: Smaller chick found on branch below the nest, mercury sampled and returned to nest 4/21: dead chick" +2023,little_d,343,greg,2023-03-31,,2,nestling,"3/24: could only confirm 2 chicks 4/7: Smaller chick found on branch below the nest, mercury sampled and returned to nest 4/21: dead chick" +2023,little_d,343,greg,2023-04-07,,2,nestling,"3/24: could only confirm 2 chicks 4/7: Smaller chick found on branch below the nest, mercury sampled and returned to nest 4/21: dead chick" +2023,little_d,343,greg,2023-04-14,,1,nestling,"3/24: could only confirm 2 chicks 4/7: Smaller chick found on branch below the nest, mercury sampled and returned to nest 4/21: dead chick" +2023,little_d,343,greg,2023-04-21,,,empty,"3/24: could only confirm 2 chicks 4/7: Smaller chick found on branch below the nest, mercury sampled and returned to nest 4/21: dead chick" +2023,little_d,343,greg,2023-04-28,,,pulled,"3/24: could only confirm 2 chicks 4/7: Smaller chick found on branch below the nest, mercury sampled and returned to nest 4/21: dead chick" +2023,little_d,343,greg,2023-05-04,,,,"3/24: could only confirm 2 chicks 4/7: Smaller chick found on branch below the nest, mercury sampled and returned to nest 4/21: dead chick" +2023,little_d,343,greg,2023-05-11,,,,"3/24: could only confirm 2 chicks 4/7: Smaller chick found on branch below the nest, mercury sampled and returned to nest 4/21: dead chick" +2023,little_d,509,greg,2023-02-24,,,,"Chick small, but still being fed, 5/11-looks healthy enough, and lively flag pulled" +2023,little_d,509,greg,2023-03-03,,,,"Chick small, but still being fed, 5/11-looks healthy enough, and lively flag pulled" +2023,little_d,509,greg,2023-03-10,,,,"Chick small, but still being fed, 5/11-looks healthy enough, and lively flag pulled" +2023,little_d,509,greg,2023-03-17,3,,incubating,"Chick small, but still being fed, 5/11-looks healthy enough, and lively flag pulled" +2023,little_d,509,greg,2023-03-24,3,,incubating,"Chick small, but still being fed, 5/11-looks healthy enough, and lively flag pulled" +2023,little_d,509,greg,2023-03-31,3,,incubating,"Chick small, but still being fed, 5/11-looks healthy enough, and lively flag pulled" +2023,little_d,509,greg,2023-04-07,,2,chick_dry,"Chick small, but still being fed, 5/11-looks healthy enough, and lively flag pulled" +2023,little_d,509,greg,2023-04-14,,2,nestling,"Chick small, but still being fed, 5/11-looks healthy enough, and lively flag pulled" +2023,little_d,509,greg,2023-04-21,,2,nestling,"Chick small, but still being fed, 5/11-looks healthy enough, and lively flag pulled" +2023,little_d,509,greg,2023-04-28,,1,nestling,"Chick small, but still being fed, 5/11-looks healthy enough, and lively flag pulled" +2023,little_d,509,greg,2023-05-04,,1,nestling,"Chick small, but still being fed, 5/11-looks healthy enough, and lively flag pulled" +2023,little_d,509,greg,2023-05-11,,1,nestling,"Chick small, but still being fed, 5/11-looks healthy enough, and lively flag pulled" +2023,little_d,204,greg,2023-02-24,3,,incubating,"3/10: high and to the west of number, empty nest platform to the east 4/7: trees thick, don't see branchlings 4/21: 2 branchlings running in general area--could've been from other nests" +2023,little_d,204,greg,2023-03-03,3,,incubating,"3/10: high and to the west of number, empty nest platform to the east 4/7: trees thick, don't see branchlings 4/21: 2 branchlings running in general area--could've been from other nests" +2023,little_d,204,greg,2023-03-10,3,,incubating,"3/10: high and to the west of number, empty nest platform to the east 4/7: trees thick, don't see branchlings 4/21: 2 branchlings running in general area--could've been from other nests" +2023,little_d,204,greg,2023-03-17,1,2,hatching,"3/10: high and to the west of number, empty nest platform to the east 4/7: trees thick, don't see branchlings 4/21: 2 branchlings running in general area--could've been from other nests" +2023,little_d,204,greg,2023-03-24,,3,nestling,"3/10: high and to the west of number, empty nest platform to the east 4/7: trees thick, don't see branchlings 4/21: 2 branchlings running in general area--could've been from other nests" +2023,little_d,204,greg,2023-03-31,,2,nestling,"3/10: high and to the west of number, empty nest platform to the east 4/7: trees thick, don't see branchlings 4/21: 2 branchlings running in general area--could've been from other nests" +2023,little_d,204,greg,2023-04-07,,,empty,"3/10: high and to the west of number, empty nest platform to the east 4/7: trees thick, don't see branchlings 4/21: 2 branchlings running in general area--could've been from other nests" +2023,little_d,204,greg,2023-04-14,,,empty,"3/10: high and to the west of number, empty nest platform to the east 4/7: trees thick, don't see branchlings 4/21: 2 branchlings running in general area--could've been from other nests" +2023,little_d,204,greg,2023-04-21,,,empty,"3/10: high and to the west of number, empty nest platform to the east 4/7: trees thick, don't see branchlings 4/21: 2 branchlings running in general area--could've been from other nests" +2023,little_d,204,greg,2023-04-28,,,empty,"3/10: high and to the west of number, empty nest platform to the east 4/7: trees thick, don't see branchlings 4/21: 2 branchlings running in general area--could've been from other nests" +2023,little_d,204,greg,2023-05-04,,,pulled,"3/10: high and to the west of number, empty nest platform to the east 4/7: trees thick, don't see branchlings 4/21: 2 branchlings running in general area--could've been from other nests" +2023,little_d,204,greg,2023-05-11,,,,"3/10: high and to the west of number, empty nest platform to the east 4/7: trees thick, don't see branchlings 4/21: 2 branchlings running in general area--could've been from other nests" +2023,little_d,223,greg,2023-02-24,1,,incubating,"3/24: at least 1 dead chick in nest" +2023,little_d,223,greg,2023-03-03,2,,incubating,"3/24: at least 1 dead chick in nest" +2023,little_d,223,greg,2023-03-10,2,,incubating,"3/24: at least 1 dead chick in nest" +2023,little_d,223,greg,2023-03-17,2,,incubating,"3/24: at least 1 dead chick in nest" +2023,little_d,223,greg,2023-03-24,,,empty,"3/24: at least 1 dead chick in nest" +2023,little_d,223,greg,2023-03-31,,,,"3/24: at least 1 dead chick in nest" +2023,little_d,223,greg,2023-04-07,,,pulled,"3/24: at least 1 dead chick in nest" +2023,little_d,223,greg,2023-04-14,,,,"3/24: at least 1 dead chick in nest" +2023,little_d,223,greg,2023-04-21,,,,"3/24: at least 1 dead chick in nest" +2023,little_d,223,greg,2023-04-28,,,,"3/24: at least 1 dead chick in nest" +2023,little_d,223,greg,2023-05-04,,,,"3/24: at least 1 dead chick in nest" +2023,little_d,223,greg,2023-05-11,,,,"3/24: at least 1 dead chick in nest" +2023,little_d,225,greg,2023-02-24,3,,incubating,"3/24: 1 dead chick" +2023,little_d,225,greg,2023-03-03,3,,incubating,"3/24: 1 dead chick" +2023,little_d,225,greg,2023-03-10,2,1,wet_chick,"3/24: 1 dead chick" +2023,little_d,225,greg,2023-03-17,,2,nestling,"3/24: 1 dead chick" +2023,little_d,225,greg,2023-03-24,,,empty,"3/24: 1 dead chick" +2023,little_d,225,greg,2023-03-31,,,,"3/24: 1 dead chick" +2023,little_d,225,greg,2023-04-07,,,pulled,"3/24: 1 dead chick" +2023,little_d,225,greg,2023-04-14,,,,"3/24: 1 dead chick" +2023,little_d,225,greg,2023-04-21,,,,"3/24: 1 dead chick" +2023,little_d,225,greg,2023-04-28,,,,"3/24: 1 dead chick" +2023,little_d,225,greg,2023-05-04,,,,"3/24: 1 dead chick" +2023,little_d,225,greg,2023-05-11,,,,"3/24: 1 dead chick" +2023,little_d,400,greg,2023-02-24,,,,"3/10: about 2 meters north of number, 3/17: two eggs, one chick, first chick hatching right now and one egg pipping 3/24: could only confirm 2 chicks; 4/14: bedraggled chicks 4/21: one live chick and one dead chick in nest, mercury sampled live chick" +2023,little_d,400,greg,2023-03-03,,,,"3/10: about 2 meters north of number, 3/17: two eggs, one chick, first chick hatching right now and one egg pipping 3/24: could only confirm 2 chicks; 4/14: bedraggled chicks 4/21: one live chick and one dead chick in nest, mercury sampled live chick" +2023,little_d,400,greg,2023-03-10,3,,incubating,"3/10: about 2 meters north of number, 3/17: two eggs, one chick, first chick hatching right now and one egg pipping 3/24: could only confirm 2 chicks; 4/14: bedraggled chicks 4/21: one live chick and one dead chick in nest, mercury sampled live chick" +2023,little_d,400,greg,2023-03-17,2,1,wet_chick,"3/10: about 2 meters north of number, 3/17: two eggs, one chick, first chick hatching right now and one egg pipping 3/24: could only confirm 2 chicks; 4/14: bedraggled chicks 4/21: one live chick and one dead chick in nest, mercury sampled live chick" +2023,little_d,400,greg,2023-03-24,,2,nestling,"3/10: about 2 meters north of number, 3/17: two eggs, one chick, first chick hatching right now and one egg pipping 3/24: could only confirm 2 chicks; 4/14: bedraggled chicks 4/21: one live chick and one dead chick in nest, mercury sampled live chick" +2023,little_d,400,greg,2023-03-31,,2,nestling,"3/10: about 2 meters north of number, 3/17: two eggs, one chick, first chick hatching right now and one egg pipping 3/24: could only confirm 2 chicks; 4/14: bedraggled chicks 4/21: one live chick and one dead chick in nest, mercury sampled live chick" +2023,little_d,400,greg,2023-04-07,,2,nestling,"3/10: about 2 meters north of number, 3/17: two eggs, one chick, first chick hatching right now and one egg pipping 3/24: could only confirm 2 chicks; 4/14: bedraggled chicks 4/21: one live chick and one dead chick in nest, mercury sampled live chick" +2023,little_d,400,greg,2023-04-14,,2,nestling,"3/10: about 2 meters north of number, 3/17: two eggs, one chick, first chick hatching right now and one egg pipping 3/24: could only confirm 2 chicks; 4/14: bedraggled chicks 4/21: one live chick and one dead chick in nest, mercury sampled live chick" +2023,little_d,400,greg,2023-04-21,,1,nestling,"3/10: about 2 meters north of number, 3/17: two eggs, one chick, first chick hatching right now and one egg pipping 3/24: could only confirm 2 chicks; 4/14: bedraggled chicks 4/21: one live chick and one dead chick in nest, mercury sampled live chick" +2023,little_d,400,greg,2023-04-28,,,pulled,"3/10: about 2 meters north of number, 3/17: two eggs, one chick, first chick hatching right now and one egg pipping 3/24: could only confirm 2 chicks; 4/14: bedraggled chicks 4/21: one live chick and one dead chick in nest, mercury sampled live chick" +2023,little_d,400,greg,2023-05-04,,,,"3/10: about 2 meters north of number, 3/17: two eggs, one chick, first chick hatching right now and one egg pipping 3/24: could only confirm 2 chicks; 4/14: bedraggled chicks 4/21: one live chick and one dead chick in nest, mercury sampled live chick" +2023,little_d,400,greg,2023-05-11,,,,"3/10: about 2 meters north of number, 3/17: two eggs, one chick, first chick hatching right now and one egg pipping 3/24: could only confirm 2 chicks; 4/14: bedraggled chicks 4/21: one live chick and one dead chick in nest, mercury sampled live chick" +2023,little_d,206,greg,2023-02-24,3,,incubating,"3/31: 1 dead chick also in nest 4/21: dead chick in nest, at least one branchling above 206/208" +2023,little_d,206,greg,2023-03-03,3,,incubating,"3/31: 1 dead chick also in nest 4/21: dead chick in nest, at least one branchling above 206/208" +2023,little_d,206,greg,2023-03-10,3,,incubating,"3/31: 1 dead chick also in nest 4/21: dead chick in nest, at least one branchling above 206/208" +2023,little_d,206,greg,2023-03-17,3,,incubating,"3/31: 1 dead chick also in nest 4/21: dead chick in nest, at least one branchling above 206/208" +2023,little_d,206,greg,2023-03-24,,3,nestling,"3/31: 1 dead chick also in nest 4/21: dead chick in nest, at least one branchling above 206/208" +2023,little_d,206,greg,2023-03-31,,2,nestling,"3/31: 1 dead chick also in nest 4/21: dead chick in nest, at least one branchling above 206/208" +2023,little_d,206,greg,2023-04-07,,2,nestling,"3/31: 1 dead chick also in nest 4/21: dead chick in nest, at least one branchling above 206/208" +2023,little_d,206,greg,2023-04-14,,2,nestling,"3/31: 1 dead chick also in nest 4/21: dead chick in nest, at least one branchling above 206/208" +2023,little_d,206,greg,2023-04-21,,,empty,"3/31: 1 dead chick also in nest 4/21: dead chick in nest, at least one branchling above 206/208" +2023,little_d,206,greg,2023-04-28,,,empty,"3/31: 1 dead chick also in nest 4/21: dead chick in nest, at least one branchling above 206/208" +2023,little_d,206,greg,2023-05-04,,,pulled,"3/31: 1 dead chick also in nest 4/21: dead chick in nest, at least one branchling above 206/208" +2023,little_d,206,greg,2023-05-11,,,,"3/31: 1 dead chick also in nest 4/21: dead chick in nest, at least one branchling above 206/208" +2023,little_d,208,greg,2023-02-24,3,,incubating,"4/14: parent or 3rd chick in nest, would not fly away 4/21: one branchling above 206/208" +2023,little_d,208,greg,2023-03-03,3,,incubating,"4/14: parent or 3rd chick in nest, would not fly away 4/21: one branchling above 206/208" +2023,little_d,208,greg,2023-03-10,2,1,chick_dry,"4/14: parent or 3rd chick in nest, would not fly away 4/21: one branchling above 206/208" +2023,little_d,208,greg,2023-03-17,,3,nestling,"4/14: parent or 3rd chick in nest, would not fly away 4/21: one branchling above 206/208" +2023,little_d,208,greg,2023-03-24,,3,nestling,"4/14: parent or 3rd chick in nest, would not fly away 4/21: one branchling above 206/208" +2023,little_d,208,greg,2023-03-31,,2,nestling,"4/14: parent or 3rd chick in nest, would not fly away 4/21: one branchling above 206/208" +2023,little_d,208,greg,2023-04-07,,2,nestling,"4/14: parent or 3rd chick in nest, would not fly away 4/21: one branchling above 206/208" +2023,little_d,208,greg,2023-04-14,,2,nestling,"4/14: parent or 3rd chick in nest, would not fly away 4/21: one branchling above 206/208" +2023,little_d,208,greg,2023-04-21,,,empty,"4/14: parent or 3rd chick in nest, would not fly away 4/21: one branchling above 206/208" +2023,little_d,208,greg,2023-04-28,,,empty,"4/14: parent or 3rd chick in nest, would not fly away 4/21: one branchling above 206/208" +2023,little_d,208,greg,2023-05-04,,,pulled,"4/14: parent or 3rd chick in nest, would not fly away 4/21: one branchling above 206/208" +2023,little_d,208,greg,2023-05-11,,,,"4/14: parent or 3rd chick in nest, would not fly away 4/21: one branchling above 206/208" +2023,little_d,511,greg,2023-02-24,,,, +2023,little_d,511,greg,2023-03-03,,,, +2023,little_d,511,greg,2023-03-10,,,, +2023,little_d,511,greg,2023-03-17,3,,incubating, +2023,little_d,511,greg,2023-03-24,3,,incubating, +2023,little_d,511,greg,2023-03-31,3,,incubating, +2023,little_d,511,greg,2023-04-07,3,,incubating, +2023,little_d,511,greg,2023-04-14,,,empty, +2023,little_d,511,greg,2023-04-21,,,pulled, +2023,little_d,511,greg,2023-04-28,,,pulled, +2023,little_d,511,greg,2023-05-04,,,, +2023,little_d,511,greg,2023-05-11,,,, +2023,little_d,513,greg,2023-02-24,,,, +2023,little_d,513,greg,2023-03-03,,,, +2023,little_d,513,greg,2023-03-10,,,, +2023,little_d,513,greg,2023-03-17,2,,incubating, +2023,little_d,513,greg,2023-03-24,2,,incubating, +2023,little_d,513,greg,2023-03-31,,,empty, +2023,little_d,513,greg,2023-04-07,,,pulled, +2023,little_d,513,greg,2023-04-14,,,, +2023,little_d,513,greg,2023-04-21,,,, +2023,little_d,513,greg,2023-04-28,,,, +2023,little_d,513,greg,2023-05-04,,,, +2023,little_d,513,greg,2023-05-11,,,, +2023,little_d,227,greg,2023-02-24,1,,incubating,"3/10: eggshell on the ground, 3/17: relay? 3/24: egg pipping" +2023,little_d,227,greg,2023-03-03,2,,incubating,"3/10: eggshell on the ground, 3/17: relay? 3/24: egg pipping" +2023,little_d,227,greg,2023-03-10,,,empty,"3/10: eggshell on the ground, 3/17: relay? 3/24: egg pipping" +2023,little_d,227,greg,2023-03-17,2,,incubating,"3/10: eggshell on the ground, 3/17: relay? 3/24: egg pipping" +2023,little_d,227,greg,2023-03-24,1,1,pipping,"3/10: eggshell on the ground, 3/17: relay? 3/24: egg pipping" +2023,little_d,227,greg,2023-03-31,,,empty,"3/10: eggshell on the ground, 3/17: relay? 3/24: egg pipping" +2023,little_d,227,greg,2023-04-07,,,pulled,"3/10: eggshell on the ground, 3/17: relay? 3/24: egg pipping" +2023,little_d,227,greg,2023-04-14,,,,"3/10: eggshell on the ground, 3/17: relay? 3/24: egg pipping" +2023,little_d,227,greg,2023-04-21,,,,"3/10: eggshell on the ground, 3/17: relay? 3/24: egg pipping" +2023,little_d,227,greg,2023-04-28,,,,"3/10: eggshell on the ground, 3/17: relay? 3/24: egg pipping" +2023,little_d,227,greg,2023-05-04,,,,"3/10: eggshell on the ground, 3/17: relay? 3/24: egg pipping" +2023,little_d,227,greg,2023-05-11,,,,"3/10: eggshell on the ground, 3/17: relay? 3/24: egg pipping" +2023,little_d,210,greg,2023-02-24,3,,incubating,"a little off the flagged path; 3/31: 1 dead chick also in nest 4/21: one dead chick in nest, and big chick running could've been from 345 or 210, 4/28: two live chicks and one dead in area between 210, 212, and 345 -- dead chick sampled" +2023,little_d,210,greg,2023-03-03,3,,incubating,"a little off the flagged path; 3/31: 1 dead chick also in nest 4/21: one dead chick in nest, and big chick running could've been from 345 or 210, 4/28: two live chicks and one dead in area between 210, 212, and 345 -- dead chick sampled" +2023,little_d,210,greg,2023-03-10,3,,incubating,"a little off the flagged path; 3/31: 1 dead chick also in nest 4/21: one dead chick in nest, and big chick running could've been from 345 or 210, 4/28: two live chicks and one dead in area between 210, 212, and 345 -- dead chick sampled" +2023,little_d,210,greg,2023-03-17,1,2,wet_chick,"a little off the flagged path; 3/31: 1 dead chick also in nest 4/21: one dead chick in nest, and big chick running could've been from 345 or 210, 4/28: two live chicks and one dead in area between 210, 212, and 345 -- dead chick sampled" +2023,little_d,210,greg,2023-03-24,,3,nestling,"a little off the flagged path; 3/31: 1 dead chick also in nest 4/21: one dead chick in nest, and big chick running could've been from 345 or 210, 4/28: two live chicks and one dead in area between 210, 212, and 345 -- dead chick sampled" +2023,little_d,210,greg,2023-03-31,,2,nestling,"a little off the flagged path; 3/31: 1 dead chick also in nest 4/21: one dead chick in nest, and big chick running could've been from 345 or 210, 4/28: two live chicks and one dead in area between 210, 212, and 345 -- dead chick sampled" +2023,little_d,210,greg,2023-04-07,,2,nestling,"a little off the flagged path; 3/31: 1 dead chick also in nest 4/21: one dead chick in nest, and big chick running could've been from 345 or 210, 4/28: two live chicks and one dead in area between 210, 212, and 345 -- dead chick sampled" +2023,little_d,210,greg,2023-04-14,,2,nestling,"a little off the flagged path; 3/31: 1 dead chick also in nest 4/21: one dead chick in nest, and big chick running could've been from 345 or 210, 4/28: two live chicks and one dead in area between 210, 212, and 345 -- dead chick sampled" +2023,little_d,210,greg,2023-04-21,,,empty,"a little off the flagged path; 3/31: 1 dead chick also in nest 4/21: one dead chick in nest, and big chick running could've been from 345 or 210, 4/28: two live chicks and one dead in area between 210, 212, and 345 -- dead chick sampled" +2023,little_d,210,greg,2023-04-28,,,empty,"a little off the flagged path; 3/31: 1 dead chick also in nest 4/21: one dead chick in nest, and big chick running could've been from 345 or 210, 4/28: two live chicks and one dead in area between 210, 212, and 345 -- dead chick sampled" +2023,little_d,210,greg,2023-05-04,,,pulled,"a little off the flagged path; 3/31: 1 dead chick also in nest 4/21: one dead chick in nest, and big chick running could've been from 345 or 210, 4/28: two live chicks and one dead in area between 210, 212, and 345 -- dead chick sampled" +2023,little_d,210,greg,2023-05-11,,,,"a little off the flagged path; 3/31: 1 dead chick also in nest 4/21: one dead chick in nest, and big chick running could've been from 345 or 210, 4/28: two live chicks and one dead in area between 210, 212, and 345 -- dead chick sampled" +2023,little_d,212,greg,2023-02-24,3,,incubating,"a little off the flagged path, 4/28: two live chicks and one dead in area between 210, 212, and 345 -- dead chick sampled" +2023,little_d,212,greg,2023-03-03,3,,incubating,"a little off the flagged path, 4/28: two live chicks and one dead in area between 210, 212, and 345 -- dead chick sampled" +2023,little_d,212,greg,2023-03-10,3,,incubating,"a little off the flagged path, 4/28: two live chicks and one dead in area between 210, 212, and 345 -- dead chick sampled" +2023,little_d,212,greg,2023-03-17,3,,incubating,"a little off the flagged path, 4/28: two live chicks and one dead in area between 210, 212, and 345 -- dead chick sampled" +2023,little_d,212,greg,2023-03-24,,2,nestling,"a little off the flagged path, 4/28: two live chicks and one dead in area between 210, 212, and 345 -- dead chick sampled" +2023,little_d,212,greg,2023-03-31,,2,nestling,"a little off the flagged path, 4/28: two live chicks and one dead in area between 210, 212, and 345 -- dead chick sampled" +2023,little_d,212,greg,2023-04-07,,2,nestling,"a little off the flagged path, 4/28: two live chicks and one dead in area between 210, 212, and 345 -- dead chick sampled" +2023,little_d,212,greg,2023-04-14,,2,nestling,"a little off the flagged path, 4/28: two live chicks and one dead in area between 210, 212, and 345 -- dead chick sampled" +2023,little_d,212,greg,2023-04-21,,2,branchling,"a little off the flagged path, 4/28: two live chicks and one dead in area between 210, 212, and 345 -- dead chick sampled" +2023,little_d,212,greg,2023-04-28,,,empty,"a little off the flagged path, 4/28: two live chicks and one dead in area between 210, 212, and 345 -- dead chick sampled" +2023,little_d,212,greg,2023-05-04,,,pulled,"a little off the flagged path, 4/28: two live chicks and one dead in area between 210, 212, and 345 -- dead chick sampled" +2023,little_d,212,greg,2023-05-11,,,,"a little off the flagged path, 4/28: two live chicks and one dead in area between 210, 212, and 345 -- dead chick sampled" +2023,little_d,328,greg,2023-02-24,,,,"3/31: all chicks dry" +2023,little_d,328,greg,2023-03-03,3,,incubating,"3/31: all chicks dry" +2023,little_d,328,greg,2023-03-10,3,,incubating,"3/31: all chicks dry" +2023,little_d,328,greg,2023-03-17,3,,incubating,"3/31: all chicks dry" +2023,little_d,328,greg,2023-03-24,3,,incubating,"3/31: all chicks dry" +2023,little_d,328,greg,2023-03-31,,3,chick_dry,"3/31: all chicks dry" +2023,little_d,328,greg,2023-04-07,,3,nestling,"3/31: all chicks dry" +2023,little_d,328,greg,2023-04-14,,,empty,"3/31: all chicks dry" +2023,little_d,328,greg,2023-04-21,,,empty,"3/31: all chicks dry" +2023,little_d,328,greg,2023-04-28,,,pulled,"3/31: all chicks dry" +2023,little_d,328,greg,2023-05-04,,,,"3/31: all chicks dry" +2023,little_d,328,greg,2023-05-11,,,,"3/31: all chicks dry" +2023,little_d,345,greg,2023-02-24,,,,"3/3: near 210 and 212; 3/31: 1 dead chick also in nest 4/21: chick possibly from 210, 4/28: two live chicks and one dead in area between 210, 212, and 345 -- dead chick sampled" +2023,little_d,345,greg,2023-03-03,3,,incubating,"3/3: near 210 and 212; 3/31: 1 dead chick also in nest 4/21: chick possibly from 210, 4/28: two live chicks and one dead in area between 210, 212, and 345 -- dead chick sampled" +2023,little_d,345,greg,2023-03-10,3,,incubating,"3/3: near 210 and 212; 3/31: 1 dead chick also in nest 4/21: chick possibly from 210, 4/28: two live chicks and one dead in area between 210, 212, and 345 -- dead chick sampled" +2023,little_d,345,greg,2023-03-17,3,,incubating,"3/3: near 210 and 212; 3/31: 1 dead chick also in nest 4/21: chick possibly from 210, 4/28: two live chicks and one dead in area between 210, 212, and 345 -- dead chick sampled" +2023,little_d,345,greg,2023-03-24,,3,nestling,"3/3: near 210 and 212; 3/31: 1 dead chick also in nest 4/21: chick possibly from 210, 4/28: two live chicks and one dead in area between 210, 212, and 345 -- dead chick sampled" +2023,little_d,345,greg,2023-03-31,,2,nestling,"3/3: near 210 and 212; 3/31: 1 dead chick also in nest 4/21: chick possibly from 210, 4/28: two live chicks and one dead in area between 210, 212, and 345 -- dead chick sampled" +2023,little_d,345,greg,2023-04-07,,2,nestling,"3/3: near 210 and 212; 3/31: 1 dead chick also in nest 4/21: chick possibly from 210, 4/28: two live chicks and one dead in area between 210, 212, and 345 -- dead chick sampled" +2023,little_d,345,greg,2023-04-14,,1,nestling,"3/3: near 210 and 212; 3/31: 1 dead chick also in nest 4/21: chick possibly from 210, 4/28: two live chicks and one dead in area between 210, 212, and 345 -- dead chick sampled" +2023,little_d,345,greg,2023-04-21,,1,branchling,"3/3: near 210 and 212; 3/31: 1 dead chick also in nest 4/21: chick possibly from 210, 4/28: two live chicks and one dead in area between 210, 212, and 345 -- dead chick sampled" +2023,little_d,345,greg,2023-04-28,,,empty,"3/3: near 210 and 212; 3/31: 1 dead chick also in nest 4/21: chick possibly from 210, 4/28: two live chicks and one dead in area between 210, 212, and 345 -- dead chick sampled" +2023,little_d,345,greg,2023-05-04,,,pulled,"3/3: near 210 and 212; 3/31: 1 dead chick also in nest 4/21: chick possibly from 210, 4/28: two live chicks and one dead in area between 210, 212, and 345 -- dead chick sampled" +2023,little_d,345,greg,2023-05-11,,,,"3/3: near 210 and 212; 3/31: 1 dead chick also in nest 4/21: chick possibly from 210, 4/28: two live chicks and one dead in area between 210, 212, and 345 -- dead chick sampled" +2023,little_d,330,greg,2023-02-24,,,,"3/3: monstrously tall, above empty nest 3/10 nest gone, eggshell on ground, flag pulled" +2023,little_d,330,greg,2023-03-03,2,,incubating,"3/3: monstrously tall, above empty nest 3/10 nest gone, eggshell on ground, flag pulled" +2023,little_d,330,greg,2023-03-10,,,empty,"3/3: monstrously tall, above empty nest 3/10 nest gone, eggshell on ground, flag pulled" +2023,little_d,330,greg,2023-03-17,,,,"3/3: monstrously tall, above empty nest 3/10 nest gone, eggshell on ground, flag pulled" +2023,little_d,330,greg,2023-03-24,,,,"3/3: monstrously tall, above empty nest 3/10 nest gone, eggshell on ground, flag pulled" +2023,little_d,330,greg,2023-03-31,,,,"3/3: monstrously tall, above empty nest 3/10 nest gone, eggshell on ground, flag pulled" +2023,little_d,330,greg,2023-04-07,,,,"3/3: monstrously tall, above empty nest 3/10 nest gone, eggshell on ground, flag pulled" +2023,little_d,330,greg,2023-04-14,,,,"3/3: monstrously tall, above empty nest 3/10 nest gone, eggshell on ground, flag pulled" +2023,little_d,330,greg,2023-04-21,,,,"3/3: monstrously tall, above empty nest 3/10 nest gone, eggshell on ground, flag pulled" +2023,little_d,330,greg,2023-04-28,,,,"3/3: monstrously tall, above empty nest 3/10 nest gone, eggshell on ground, flag pulled" +2023,little_d,330,greg,2023-05-04,,,,"3/3: monstrously tall, above empty nest 3/10 nest gone, eggshell on ground, flag pulled" +2023,little_d,330,greg,2023-05-11,,,,"3/3: monstrously tall, above empty nest 3/10 nest gone, eggshell on ground, flag pulled" +2023,little_d,332,greg,2023-02-24,,,,"3/24: eggshell on ground; 3/31: flag pulled" +2023,little_d,332,greg,2023-03-03,2,,incubating,"3/24: eggshell on ground; 3/31: flag pulled" +2023,little_d,332,greg,2023-03-10,,2,nestling,"3/24: eggshell on ground; 3/31: flag pulled" +2023,little_d,332,greg,2023-03-17,,2,nestling,"3/24: eggshell on ground; 3/31: flag pulled" +2023,little_d,332,greg,2023-03-24,,,empty,"3/24: eggshell on ground; 3/31: flag pulled" +2023,little_d,332,greg,2023-03-31,,,pulled,"3/24: eggshell on ground; 3/31: flag pulled" +2023,little_d,332,greg,2023-04-07,,,,"3/24: eggshell on ground; 3/31: flag pulled" +2023,little_d,332,greg,2023-04-14,,,,"3/24: eggshell on ground; 3/31: flag pulled" +2023,little_d,332,greg,2023-04-21,,,,"3/24: eggshell on ground; 3/31: flag pulled" +2023,little_d,332,greg,2023-04-28,,,,"3/24: eggshell on ground; 3/31: flag pulled" +2023,little_d,332,greg,2023-05-04,,,,"3/24: eggshell on ground; 3/31: flag pulled" +2023,little_d,332,greg,2023-05-11,,,,"3/24: eggshell on ground; 3/31: flag pulled" +2023,little_d,334,greg,2023-02-24,,,,"3/24: eggshell on ground 4/7: nest gone and flag pulled" +2023,little_d,334,greg,2023-03-03,3,,incubating,"3/24: eggshell on ground 4/7: nest gone and flag pulled" +2023,little_d,334,greg,2023-03-10,3,,incubating,"3/24: eggshell on ground 4/7: nest gone and flag pulled" +2023,little_d,334,greg,2023-03-17,3,,incubating,"3/24: eggshell on ground 4/7: nest gone and flag pulled" +2023,little_d,334,greg,2023-03-24,,,empty,"3/24: eggshell on ground 4/7: nest gone and flag pulled" +2023,little_d,334,greg,2023-03-31,,,,"3/24: eggshell on ground 4/7: nest gone and flag pulled" +2023,little_d,334,greg,2023-04-07,,,pulled,"3/24: eggshell on ground 4/7: nest gone and flag pulled" +2023,little_d,334,greg,2023-04-14,,,,"3/24: eggshell on ground 4/7: nest gone and flag pulled" +2023,little_d,334,greg,2023-04-21,,,,"3/24: eggshell on ground 4/7: nest gone and flag pulled" +2023,little_d,334,greg,2023-04-28,,,,"3/24: eggshell on ground 4/7: nest gone and flag pulled" +2023,little_d,334,greg,2023-05-04,,,,"3/24: eggshell on ground 4/7: nest gone and flag pulled" +2023,little_d,334,greg,2023-05-11,,,,"3/24: eggshell on ground 4/7: nest gone and flag pulled" +2023,little_d,402,greg,2023-02-24,,,,"3/10: Up high 3/31: two eggshells on ground 4/7: nest gone and flag pulled" +2023,little_d,402,greg,2023-03-03,,,,"3/10: Up high 3/31: two eggshells on ground 4/7: nest gone and flag pulled" +2023,little_d,402,greg,2023-03-10,2,,incubating,"3/10: Up high 3/31: two eggshells on ground 4/7: nest gone and flag pulled" +2023,little_d,402,greg,2023-03-17,2,,incubating,"3/10: Up high 3/31: two eggshells on ground 4/7: nest gone and flag pulled" +2023,little_d,402,greg,2023-03-24,2,,incubating,"3/10: Up high 3/31: two eggshells on ground 4/7: nest gone and flag pulled" +2023,little_d,402,greg,2023-03-31,,,empty,"3/10: Up high 3/31: two eggshells on ground 4/7: nest gone and flag pulled" +2023,little_d,402,greg,2023-04-07,,,pulled,"3/10: Up high 3/31: two eggshells on ground 4/7: nest gone and flag pulled" +2023,little_d,402,greg,2023-04-14,,,,"3/10: Up high 3/31: two eggshells on ground 4/7: nest gone and flag pulled" +2023,little_d,402,greg,2023-04-21,,,,"3/10: Up high 3/31: two eggshells on ground 4/7: nest gone and flag pulled" +2023,little_d,402,greg,2023-04-28,,,,"3/10: Up high 3/31: two eggshells on ground 4/7: nest gone and flag pulled" +2023,little_d,402,greg,2023-05-04,,,,"3/10: Up high 3/31: two eggshells on ground 4/7: nest gone and flag pulled" +2023,little_d,402,greg,2023-05-11,,,,"3/10: Up high 3/31: two eggshells on ground 4/7: nest gone and flag pulled" +2023,little_d,515,greg,2023-02-24,,,,"3/24: 1 egg hard to see, partially buried in nest material 3/31: egg buried, nest doesn't look active; 4/14: flag pulled" +2023,little_d,515,greg,2023-03-03,,,,"3/24: 1 egg hard to see, partially buried in nest material 3/31: egg buried, nest doesn't look active; 4/14: flag pulled" +2023,little_d,515,greg,2023-03-10,,,,"3/24: 1 egg hard to see, partially buried in nest material 3/31: egg buried, nest doesn't look active; 4/14: flag pulled" +2023,little_d,515,greg,2023-03-17,2,,incubating,"3/24: 1 egg hard to see, partially buried in nest material 3/31: egg buried, nest doesn't look active; 4/14: flag pulled" +2023,little_d,515,greg,2023-03-24,2,,incubating,"3/24: 1 egg hard to see, partially buried in nest material 3/31: egg buried, nest doesn't look active; 4/14: flag pulled" +2023,little_d,515,greg,2023-03-31,1,,incubating,"3/24: 1 egg hard to see, partially buried in nest material 3/31: egg buried, nest doesn't look active; 4/14: flag pulled" +2023,little_d,515,greg,2023-04-07,,,missed,"3/24: 1 egg hard to see, partially buried in nest material 3/31: egg buried, nest doesn't look active; 4/14: flag pulled" +2023,little_d,515,greg,2023-04-14,,,empty,"3/24: 1 egg hard to see, partially buried in nest material 3/31: egg buried, nest doesn't look active; 4/14: flag pulled" +2023,little_d,515,greg,2023-04-21,,,,"3/24: 1 egg hard to see, partially buried in nest material 3/31: egg buried, nest doesn't look active; 4/14: flag pulled" +2023,little_d,515,greg,2023-04-28,,,,"3/24: 1 egg hard to see, partially buried in nest material 3/31: egg buried, nest doesn't look active; 4/14: flag pulled" +2023,little_d,515,greg,2023-05-04,,,,"3/24: 1 egg hard to see, partially buried in nest material 3/31: egg buried, nest doesn't look active; 4/14: flag pulled" +2023,little_d,515,greg,2023-05-11,,,,"3/24: 1 egg hard to see, partially buried in nest material 3/31: egg buried, nest doesn't look active; 4/14: flag pulled" +2023,little_d,530,greg,2023-02-24,,,, +2023,little_d,530,greg,2023-03-03,,,, +2023,little_d,530,greg,2023-03-10,,,, +2023,little_d,530,greg,2023-03-17,,,, +2023,little_d,530,greg,2023-03-24,2,,incubating, +2023,little_d,530,greg,2023-03-31,,,empty, +2023,little_d,530,greg,2023-04-07,,,pulled, +2023,little_d,530,greg,2023-04-14,,,, +2023,little_d,530,greg,2023-04-21,,,, +2023,little_d,530,greg,2023-04-28,,,, +2023,little_d,530,greg,2023-05-04,,,, +2023,little_d,530,greg,2023-05-11,,,, diff --git a/SiteandMethods/species_list.csv b/SiteandMethods/species_list.csv index 964b316..1d3892f 100644 --- a/SiteandMethods/species_list.csv +++ b/SiteandMethods/species_list.csv @@ -1,24 +1,24 @@ "species","commonname","scientificname","target_species","incubation_j","nestling_j","clutch_size","egg_color","nest_size","nest_materials","nest_microhabitat","colony_habitat","brood_size","nest_success","chick_description","typical_timing_range","courtship_period","nestbuilding_period","reproductive_period","nestling_period","incubation_period","branchling_period","feeding_methods","foraging_depth","foraging_type","niche_description","prey" -anhi,Anhinga,Anhinga anhinga,no,,,"2 - 5","Conspicuously pointed at one end, pale bluish green, and overlaid with a chalky coating","","","","shallow, slow-moving, sheltered waters","1","","Naked, with eyes open","","","","","14 - 21 days","26 - 30 days","","swims slowly underwater, stalking fish around submerged vegetation, spear fish","","","","small- to medium-sized wetland fishes, with very small amounts of crustaceans and invertebrates" +anhi,Anhinga,Anhinga anhinga,no,22,14,"2 - 5","Conspicuously pointed at one end, pale bluish green, and overlaid with a chalky coating","","","","shallow, slow-moving, sheltered waters","1","","Naked, with eyes open","","","","","14 - 21 days","26 - 30 days","","swims slowly underwater, stalking fish around submerged vegetation, spear fish","","","","small- to medium-sized wetland fishes, with very small amounts of crustaceans and invertebrates" bcnh,Black Crowned Night Heron,Nycticorax nycticorax,no,28,21,"","","","","","","","","","","","","","","","","","","","","" -caeg,Cattle Egret,Bubulcus ibis,no,,,"","","","","","","","","","","","","","","","","","","","","" -coga,Common Gallinule,Gallinula galeata,no,,,"","","","","","","","","","","","","","","","","","","","","" -dcco,Double-crested Cormorant,Phalacrocorax auritus,no,,,"","","","","","","","","","","","","","","","","","","","","" +caeg,Cattle Egret,Bubulcus ibis,no,22,14,"","","","","","","","","","","","","","","","","","","","","" +coga,Common Gallinule,Gallinula galeata,no,21,40,"","","","","","","","","","","","","","","","","","","","","" +dcco,Double-crested Cormorant,Phalacrocorax auritus,no,27,25,"","","","","","","","","","","","","","","","","","","","","" gbhe,Great Blue Heron,Ardea herodias,yes,28,60,"2 - 6","Pale blue, fading slightly with age","50 cm - 122 cm","sticks, lined with grass, reeds, moss, cupped","mainly in trees, but will also nest on the ground, on bushes, in mangroves, and on structures such as duck blinds, channel markers, or artificial nest platforms","","1 - 2","","bluish eyes open, covered in pale gray down, able to vocalize","","","","","49 - 81 days","27 - 29 days","","grab smaller prey in their strong mandibles or use their dagger-like bills to impale larger fish, often shaking them to break or relax the sharp spines before gulping them down","","exploiter","","anything within striking distance, including fish, amphibians, reptiles, small mammals, insects, and other birds" -glib,Glossy Ibis,Plegadis falcinellus,no,,,"","","","","","","","","","","","","","","","","","","","","" +glib,Glossy Ibis,Plegadis falcinellus,no,21,14,"","","","","","","","","","","","","","","","","","","","","" greg,Great Egret,Ardea alba,yes,28,21,"1 - 6, 4 normal","light blue green","widths of ground nests (49.2 cm ± 5.9 SD) versus tree nests (42.5 cm ± 3.7 SD) were significantly different, as were nest depths (21.2 cm ± 8.7 SD and 10.5 cm ± 2.2 SD),","sticks, vary in size","open canopy","","1 - 3","","white down, body dak gray, wram pale gray bill balck tip, change to yellow by 7 days.","Jan - May","7 - 11 days","3 - 5days","80","21","27","50+ days","walking slowly, standing and waiting, second to SNEG in number of different foraging behaviors; kleptoparasitism from other species","average 28 cm, GE will increase to 20 - 40 cm then decline","exploiter","depth more important than salinity, but will stay in open areas","98% fish, but opportunistic, size larger than other herons except for GBHE" -grhe,Green Heron,Butorides virescens,no,,,"","","","","","","","","","","","","","","","","","","","","" -lada,large dark unidentified bird,unknown,no,,,"","","","","","","","","","","","","","","","","","","","","" -lawh,large white unidentified bird,unknown,no,,,"","","","","","","","","","","","","","","","","","","","","" -lbhe,Little Blue Heron,Egretta caerulea,yes,,,"","","","","","","","","","","","","","","","","","","","","" +grhe,Green Heron,Butorides virescens,no,22,14,"","","","","","","","","","","","","","","","","","","","","" +lada,large dark unidentified bird,unknown,no,27,25,"","","","","","","","","","","","","","","","","","","","","" +lawh,large white unidentified bird,unknown,no,28,55,"","","","","","","","","","","","","","","","","","","","","" +lbhe,Little Blue Heron,Egretta caerulea,yes,22,14,"","","","","","","","","","","","","","","","","","","","","" rosp,Roseate Spoonbill,Platalea ajaja,yes,22,21,"1 - 5, 4 typical","dull white, brown spots","","twigs and large sticks","subcanopy","","","","pinkish down, tubular to flattened bills, exceptionally cute","Nov - Feb","","20 days","80","5-6weeks","22 days","60 days","tactolocation, head sweeping, will use grabbing or probing, and will run after abundant or active prey.","<12 cm, max 20 cm based on leg length","high grader","fresh to hypersaline, will feed at night; prefers coastal habitat","" -rsha,Red-shouldered Hawk,Buteo lineatus,no,,,"","","","","","","","","","","","","","","","","","","","","" -smda,small dark unidentified bird,unknown,no,,,"","","","","","","","","","","","","","","","","","","","","" +rsha,Red-shouldered Hawk,Buteo lineatus,no,36,46,"","","","","","","","","","","","","","","","","","","","","" +smda,small dark unidentified bird,unknown,no,22,14,"","","","","","","","","","","","","","","","","","","","","" smhe,small heron,unknown,no,22,14,"","","","","","","","","","","","","","","","","","","","","" -smwh,small white unidentified bird,unknown,no,,,"","","","","","","","","","","","","","","","","","","","","" -sneg,Snowy Egret,Egretta thula,yes,,,"3 - 5","pale greenish blue","","fine twigs , cupped","head to chest height, never canopy","","","","white down, leg yellowish to grayish to black, pink mouth, pale gray iris","mid - late March","","4.4 days","","15 days","22 days","","broadest repertoire of foraging of any n. american heron. Foot stirring, fly-stabbing, foot dragging, lots of habitats,","","high grader","brackish and marine, shallow water","worms, insects, crustaceans, fishes, anurans 75% fish, mosquitofish, needlefish" -trhe,Tricolored Heron,Egretta tricolor,no,,,"3 - 4","pale bluish green","","small twigs, woody vege, no green material, will nest in needlerush","subcanopy, dense, well shaded 0.15 - 3.7 m above ground","","","","brownish reddish crown, bronish gray on back, white down abdoment,","Feb - March","5 - 6 days","","","83 days","21 days","50 - 56 days","broad - striking, running, wing shading, foot raking,. Slow walking, usually solitary foraging or on edge of groups","deeper than snowy, to belly deep, 18cm max","exploiter","estuarine, coastal primary habitat","primarily fish, opportunistic, fundulus, killifishes" -unkn,Unknown,Unknown,no,,,"","","","","","","","","","","","","","","","","","","","","" +smwh,small white unidentified bird,unknown,no,22,14,"","","","","","","","","","","","","","","","","","","","","" +sneg,Snowy Egret,Egretta thula,yes,22,14,"3 - 5","pale greenish blue","","fine twigs , cupped","head to chest height, never canopy","","","","white down, leg yellowish to grayish to black, pink mouth, pale gray iris","mid - late March","","4.4 days","","15 days","22 days","","broadest repertoire of foraging of any n. american heron. Foot stirring, fly-stabbing, foot dragging, lots of habitats,","","high grader","brackish and marine, shallow water","worms, insects, crustaceans, fishes, anurans 75% fish, mosquitofish, needlefish" +trhe,Tricolored Heron,Egretta tricolor,no,22,14,"3 - 4","pale bluish green","","small twigs, woody vege, no green material, will nest in needlerush","subcanopy, dense, well shaded 0.15 - 3.7 m above ground","","","","brownish reddish crown, bronish gray on back, white down abdoment,","Feb - March","5 - 6 days","","","83 days","21 days","50 - 56 days","broad - striking, running, wing shading, foot raking,. Slow walking, usually solitary foraging or on edge of groups","deeper than snowy, to belly deep, 18cm max","exploiter","estuarine, coastal primary habitat","primarily fish, opportunistic, fundulus, killifishes" +unkn,Unknown,Unknown,no,22,14,"","","","","","","","","","","","","","","","","","","","","" whib,White Ibis,Eudocimus albus,yes,21,14,"2 - 3","creamy white to greenish, brown splotches","25 cm average","various, twigs to grass","various height, very dense","","1 - 3","5 - 70%","dark downy, pink bills with dark markings,","Feb - March in Everglades","5 - 6 days","","","15 - 18 days","22 days","61 days mean, as early as 40 days","walk and probe quickly, will use visual foraging, foot raking, pecking at surface,","14 cm on average","high grader","prefer freshwater in breeding season, will feed in coastal","crustaceans, insects, small fishes, gambusia, crayfish, fiddler crabs" wost,Wood Stork,Mycteria americana,yes,28,50,"1 - 5","creamy white","","twigs and sticks","open at top","historically cypress swamps, now many types including impoundments","","","white, sparse down, eyes closed, 60 gm at hatching","historically november, now Feb - March","","2 - 3 days","99 - 118 days","25 days","28 days","50 - 55 days","grope foraging, walking slowly with bill open in water, side to side motion, snap reflex, unitary foraging technique. Foot stirring and wing flicking","15 - 50 cm","high grader","wetlands,","fish>1 yr old, sunfishes, catfishes, killifishes, mollies," -ycnh,Yellow-crowned Night-Heron,Nyctanassa violacea,no,,,"","","","","","","","","","","","","","","","","","","","","" +ycnh,Yellow-crowned Night-Heron,Nyctanassa violacea,no,22,14,"","","","","","","","","","","","","","","","","","","","","" diff --git a/testthat/test-nests.R b/testthat/test-nests.R index 08e11b1..bf893f7 100644 --- a/testthat/test-nests.R +++ b/testthat/test-nests.R @@ -52,6 +52,13 @@ test_that("Egg and chick counts valid", { expect_true(all(nests$chicks %in% c(0,1,2,3,4,5,6,7, NA))) }) +test_that("Nest stage valid", { + + expect_true(all(nests$stage %in% c("empty", "fledged", "failed", "incubating", "nestling","hatching", + "wet_chick", "missed", "pipping", "pre_flagged", "collapsed", "pre_marked", + "pulled", "branchling", "chick_dry", "unknown", "", NA))) +}) + test_that("no duplicated rows", { expect_false(any(duplicated(success_summary)))