knitr::opts_chunk$set(echo = TRUE, 
                      message = FALSE,
                      warning = FALSE)
library(magrittr)
options(warn=-1)

Spatial: Approaches for Georges Bank Option 1

The spatial footprint for the Georges Bank EPU (Ecological Production Unit) is defined as the set of survey strata that are at 50% within the 10 min square definition of the EPU.

crs <- 4326
# NEW GB EPU def based on survey strata
coast <- sf::st_read(here::here("data-raw/gis/NES_LME_coast.shp"), quiet = T) %>%
  sf::st_transform(.,crs=crs)
GB_strata <- sf::st_read(here::here("data-raw/gis/GB_SOE_strata.shp"),quiet=T) %>%
    sf::st_transform(.,crs=crs)

ggplot2::ggplot(data=coast) +
  ggplot2::geom_sf() +
  ggplot2::geom_sf(data=GB_strata,col="black",fill="grey") + 
  ggplot2::coord_sf(xlim = c(-76,-65), ylim = c(38,44))

Overlay the surrounding statistical areas:

crs <- 4326
# read in coastline and GB shape file
coast <- sf::st_read(here::here("data-raw/gis/NES_LME_coast.shp"), quiet = T) %>%
  sf::st_transform(.,crs=crs)
GB_strata <- sf::st_read(here::here("data-raw/gis/GB_SOE_strata_stat.shp"),quiet=T) %>%
    sf::st_transform(.,crs=crs)

# separate polygons inside GB from those outside. Calculate centroid of polygon for label
GB_in <- GB_strata %>%
  dplyr::filter(grepl("in",Id) )
GB_out <- GB_strata %>%
  dplyr::filter(grepl("out",Id) ) %>% 
  dplyr::mutate(Id=stringr::str_split_fixed(Id,"_",2)[,1])
centroids <- sf::st_coordinates(sf::st_centroid(GB_out))
GB_out <- cbind(GB_out,centroids)

statAreas <- GB_out %>%
  sf::st_drop_geometry() %>%
  dplyr::distinct(Id) %>%
  dplyr::pull()

#plot map
ggplot2::ggplot(data=coast) +
  ggplot2::geom_sf() +
  ggplot2::geom_sf(data=GB_out,fill="grey") + 
  ggplot2::geom_text(data=GB_out,ggplot2::aes(x=X,y=Y,label=Id),size=2)    +
  ggplot2::geom_sf(data=GB_in,col="black") + 
  ggplot2::coord_sf(xlim = c(-76,-65), ylim = c(38,44))

Fishing data are available by statistical area. The statistical areas surrounding Georges Bank EPU (r statAreas) contain catch from Georges Bank and its neighboring EPUs. This data needs to be partitioned and catch allocated to the Georges Bank EPU.

Method for partitioning catch data

data <- readRDS(here::here("data-raw/data","Landings_VTR_Geret_Data_summarized.rds"))
yearRange <- data %>% dplyr::distinct(YEAR) %>% range

Methods found in [@depiper2014; @benjamins2018] and the offshoreWind package are briefly summarized below. It is necessary to run the package from the mars server.

The shape file shown in Figure \@ref(fig:GBfootstat) is supplied to the offshoreWind package and the landings with each statistical area (for each year) are then allocated to each portion of a statistical area (within Georges Bank and outside Georges Bank). The proportion of landings attributed to Georges Bank are then calculated and displayed below.

The top ranked species of interest are shown below. Each panel depicts the proportion of landings (for each species) in Georges Bank relative to the statistical area.

source(here::here("data-raw/R","plot_landings_proportions.R"))
plot_landings_proportions(species="rows")

The total landings of each species by stat area is shown below. This should ideally be compared to landings from comlandr. We should also determine how landings on the Canadian side of the Hague line should be handled

source(here::here("data-raw/R","plot_landings.R"))
plot_landings()

The majority of landings (for a species) occurs in statistical areas where the proportion allocated to Georges Bank is fairly constant.

References



NOAA-EDAB/ms-keyrun documentation built on April 20, 2024, 10:07 a.m.