require(knitr)
  knitr::opts_chunk$set(
    root.dir = data_root,
    echo = FALSE,
    out.width="6.2in",
#     dev.args = list(type = "cairo"),
    fig.retina = 2,
    dpi=192
  )

  # inits and data loading (front load all required data)

  require(aegis)

  year.assessment = params$year.assessment
  year_previous = year.assessment - 1
  p = bio.snowcrab::load.environment( year.assessment=year.assessment )
  SCD = project.datadirectory("bio.snowcrab")
  media_loc = params$media_loc

  # fishery_model_results = file.path( "/home", "jae", "projects", "dynamical_model", "snowcrab", "outputs" )
  fishery_model_results = file.path( SCD, "fishery_model" )

  sn_env = snowcrab_load_key_results_to_memory( year.assessment, debugging=params$debugging, loc_dde=params$loc_dde, return_as_list=TRUE  ) 

  attach(sn_env)

  # predator diet data
  diet_data_dir = file.path( SCD, "data", "diets" )
  require(data.table) # for speed
  require(lubridate)
  require(stringr) 
  require(gt)  # table formatting
  library(janitor)
  require(ggplot2)
  require(aegis) # map-related 
  require(bio.taxonomy)  # handle species codes

  # assimilate the CSV data tables:
  # diet = get_feeding_data( diet_data_dir, redo=TRUE )  # if there is a data update
  diet = get_feeding_data( diet_data_dir, redo=FALSE )
  tx = taxa_to_code("snow crab")  
  # matching codes are 
  #  spec    tsn                  tx                   vern tx_index
  #1  528 172379        BENTHODESMUS           BENTHODESMUS     1659
  #2 2522  98427        CHIONOECETES SPIDER QUEEN SNOW UNID      728
  #3 2526  98428 CHIONOECETES OPILIO        SNOW CRAB QUEEN      729
  # 2 and 3 are correct

  snowcrab_predators = diet[ preyspeccd %in% c(2522, 2526), ]  # n=159 oservations out of a total of 58287 observations in db (=0.28% of all data)
  snowcrab_predators$Species = code_to_taxa(snowcrab_predators$spec)$vern
  snowcrab_predators$Predator = factor(snowcrab_predators$Species)

  counts = snowcrab_predators[ , .(Frequency=.N), by=.(Species)]
  setorderv(counts, "Frequency", order=-1)

  # species composition
  psp = speciescomposition_parameters( yrs=p$yrs, runlabel="1999_present" )
  pca = speciescomposition_db( DS="pca", p=psp )  

  pcadata = as.data.frame( pca$loadings )
  pcadata$vern = stringr::str_to_title( taxonomy.recode( from="spec", to="taxa", tolookup=rownames( pcadata ) )$vern )

  # bycatch summaries
  o_cfaall = observer.db( DS="bycatch_summary", p=p,  yrs=p$yrs, region="cfaall" )
  o_cfanorth = observer.db( DS="bycatch_summary", p=p,  yrs=p$yrs, region="cfanorth" )   
  o_cfasouth = observer.db( DS="bycatch_summary", p=p,  yrs=p$yrs, region="cfasouth" )   
  o_cfa4x = observer.db( DS="bycatch_summary", p=p,  yrs=p$yrs, region="cfa4x" )   

SUMMARY

INTRODUCTION

include_graphics( file.path( params$media_loc, "snowcrab_image.png" ) )
# \@ref(fig:crab-image)
include_graphics( file.path (params$media_loc, "area_map.png" ) )
# \@ref(fig:sse-map)

Snow Crab (Chionoecetes opilio; Figure \@ref(fig:crab-image)) are a circumpolar, subarctic species. In the Scotian Shelf Ecosystem (SSE; Figure \@ref(fig:sse-map)), habitat preference is generally for soft mud bottoms, at depths from 60 to 300 m and temperatures from -1 to 6${}^\circ$ C. The SSE represents the southern-most part of this distribution and so most influenced by environmental variability. More detailed information with regards to Snow Crab life history, habitat requirements and spatiotemporal distributions of different life stages can be found in Choi et al. (2022) and references therein.

Management of Snow Crab in the Scotian Shelf Snow Crab fishery are inherently precautionary:

Fishery performance

ii = which(dt$Region=="cfanorth")
oo = dt[ii, c("Year", "Licenses", "TAC", "Landings", "Effort", "CPUE")] 
kable( oo, format="simple", row.names=FALSE, align="cccccc",
caption = "Fishery performance statistics in N-ENS. Units are: TACs and Landings (tons, t), Effort ($\\times 10^3$ trap hauls, th) and CPUE (kg/th).")
# \@ref(tab:table-fishery-nens)
ii = which(dt$Region=="cfasouth")
oo = dt[ii, c("Year", "Licenses", "TAC", "Landings", "Effort", "CPUE")] 
kable( oo, format="simple", row.names=FALSE, align="cccccc",
caption = "Fishery performance statistics in S-ENS. Units are: TACs and Landings (tons, t), Effort ($\\times 10^3$ trap hauls, th) and CPUE (kg/th).")
# \@ref(tab:table-fishery-nens)
ii = which(dt$Region=="cfa4x")
oo = dt[ii,c("Year", "Licenses", "TAC", "Landings", "Effort", "CPUE")]
kable(oo, format="simple", row.names=FALSE, align="cccccc",
caption = "Fishery performance statistics in 4X. Units are: TACs and Landings (tons, t), Effort ($\\times 10^3$ trap hauls, th) and CPUE (kg/th). There were no landings or TACs in 2018/2019 due to indications of low abundance. The 2022 season is ongoing.")
# \@ref(tab:table-fishery-4x)

Fishing effort

Fishing effort in r year.assessment wasrespectively, r e_nens $\times 10^3$, r e_sens $\times 10^3$ and r e_4x $\times 10^3$ trap hauls in N-ENS, S-ENS and 4X. Relative to the previous year, these represent changes of r dt_e_nens %, r dt_e_sens % and r dt_e_4x %, respectively (Tables \@ref(tab:table-fishery-nens), \@ref(tab:table-fishery-sens), \@ref(tab:table-fishery-4x), Figure \@ref(fig:effort-timeseries)). Fishing effort was consistent between r year.assessment and r year_previous in terms of spatial distribution. In S-ENS, there was, however, a spatial contraction to inshore areas and away from the area 23-24 boundary (Figure \@ref(fig:effort-map)). This is presumed to be related to, in part, warm water incursions into the area (see Ecosystem considerations, below).

fn1=file.path( SCD, "assessments", year.assessment, "timeseries", "fishery",   "effort.ts.pdf" )
knitr::include_graphics( fn1 ) 
# \@ref(fig:effort-timeseries)  
loc0= file.path( SCD, "output", "maps", "logbook", "snowcrab", "annual", "effort" )
fn1 = file.path( loc0, paste( "effort", year_previous,   "png", sep=".") ) 
fn2 = file.path( loc0, paste( "effort", year.assessment, "png", sep=".") ) 
include_graphics(  c(fn1, fn2) )
#  \@ref(fig:landings-map) 

Fishery landings and TACs

Landings across time are shown in Figure \@ref(fig:landings-timeseries). In r year.assessment, they were r l_nens, r l_sens and r l_4x t, in N-ENS, S-ENS and 4X (season ongoing), respectively. Relative to r year_previous, they represent changes of r dt_l_nens%, r dt_l_sens% and r dt_l_4x%, respectively (Tables \@ref(tab:table-fishery-nens), \@ref(tab:table-fishery-sens), \@ref(tab:table-fishery-4x)). Total Allowable Catches (TACs) for r year.assessment were r tac_nens t, r tac_sens t and r tac_4x t in N-ENS, S-ENS and 4X, respectively.

Additional carry forward allowance was implemented by DFO Fisheries Management of up to 25% of the 2020 quota to the 2021 season for N-ENS and S-ENS Snow Crab fishery. These were a response to COVID-19 related uncertainties with safe fishing activity. The carry-forward amounts were: 11.2 t in N-ENS, and 217.4 t in S-ENS (Tables \@ref(tab:table-fishery-nens), \@ref(tab:table-fishery-sens)). In 2022, landings in all areas were below respective TACs.

The landings in N-ENS for 2022 and 2021 were similar in their spatial patterns (Figure \@ref(fig:landings-map)). In S-ENS, landings, as with fishing effort, shifted slightly inshore and away from the area 23-24 boundary (Figure \@ref(fig:landings-map)). There were no landings on the continental slope areas of S-ENS in 2022; it continues to serve as a "reserve" for Snow Crab from fishing. The landings in 4X for 2022 as with 2021, were primarily in the area just south of Sambro, bordering onto area 24. In N-ENS, most landings occured in the spring.

include_graphics( file.path( SCD, "assessments", year.assessment, "timeseries", "fishery",   "landings.ts.pdf" ) )
# \@ref(fig:landings-timeseries)
loc0= file.path( SCD, "output", "maps", "logbook", "snowcrab", "annual", "landings" )
fn1 = file.path( loc0, paste( "landings", year_previous,   "png", sep=".") ) 
fn2 = file.path( loc0, paste( "landings", year.assessment, "png", sep=".") ) 
knitr::include_graphics( c(fn1, fn2 ) )
#  \@ref(fig:landings-map)  

\clearpage

Fishery catch rates

Non-standardized fishery catch rates in r year.assessment were r c_nens, r c_sens and r c_4x kg/trap haul in N-ENS, S-ENS and 4X, respectively. This represents a change of respectively, r dt_c_nens %, r dt_c_sens % and r dt_c_4x % (season ongoing) relative to the previous year (Tables \@ref(tab:table-fishery-nens), \@ref(tab:table-fishery-sens), \@ref(tab:table-fishery-4x), Figures \@ref(fig:cpue-timeseries)). Though the spatial extent of exploitation was smaller, many of the exploited areas show elevated catch rates (Figure \@ref(fig:cpue-map)).

include_graphics( file.path( SCD, "assessments", year.assessment, "timeseries", "fishery",   "cpue.ts.pdf" ) ) 
# \@ref(fig:cpue-timeseries)  
loc0= file.path( SCD, "output", "maps", "logbook", "snowcrab", "annual", "cpue" )
fn1 = file.path( loc0, paste( "cpue", year_previous,   "png", sep=".") ) 
fn2 = file.path( loc0, paste( "cpue", year.assessment, "png", sep=".") ) 
knitr::include_graphics( c(fn1, fn2 ) )
# \@ref(fig:cpue-map)  

At-Sea-Observed information

Carapace condition of the fished component is determined from At-Sea-Observed catches. In 2021, both N-ENS and 4X were not sampled by At-Sea-Observers. In 2022, 4X was not sampled by At-Sea-Observers. Estimates of carapace condition since 2020 are unreliable as they represent only small areas of the fishing grounds and short time periods relative to the whole fishing season (Figure \@ref(fig:observer-locations-map)).

loc = file.path( SCD, "output", "maps", "observer.locations" )
yrsplot = year.assessment + c(0:-4)
fn4 = file.path( loc, paste( "observer.locations", yrsplot[4], "png", sep=".") )
fn3 = file.path( loc, paste( "observer.locations", yrsplot[3], "png", sep=".") )
fn2 = file.path( loc, paste( "observer.locations", yrsplot[2], "png", sep=".") )
fn1 = file.path( loc, paste( "observer.locations", yrsplot[1], "png", sep=".") )
include_graphics( c( fn4, fn3, fn2, fn1) )
# \@ref(fig:observer-locations-map)  
#*Figure XXX. Snow Crab observer locations.*

In the exploited fraction of Snow Crab, Carapace Condition (CC) is an index of the approximate time since the last molt, and so describes the relative development and subsequent decay of the carapace. CC1 signifies a newly molted crab, soft-shelled, with no epibiont (e.g., barnacles) growth. CC2 crab have begun to harden, but is still considered to be soft and of no commercial value. CC3 and CC4 represent crab preferred by industry. The oldest carapace condition (CC5) signifies extensive shell decay with no expectation of survival into the next year.

Commercial catches of soft-shelled crab were r cc_soft_nens% (low sampling), r cc_soft_sens% (low sampling) and r cc_soft_4x% (no sampling; season ongoing) in N-ENS, S-ENS and 4X, respectively for r year.assessment. In r year_previous, it was r cc_soft_nens_p% (no sampling), r cc_soft_sens_p% (low sampling) and r cc_soft_4x_p% (no sampling), respectively. Generally, higher soft-shell indicates incoming recruitment to the fishery and their handling potential and unnecessary handling/discard mortality.

In 2022, CC5 crab levels were higher in N- and S-ENS than in previous years, though again low and inconsistent sampling effort makes this uncertain.

Bycatch in the Snow Crab fishery is also monitored from the At-Sea-Observed catches. However, due to a paupacy of consistent data, very little can be said of bycatch after 2017. Historically, bycatch in the Snow Crab fishery has been minimal (Tables 4, 5) with increasing levels as a function of increasing water temperature: bycatch is higher in warmer conditions, primarily other Crustacea (crab and lobster). Low bycatch has been attributed to trap design (top entry conical traps), the large mesh size (5.25 inches, knot to knot) and the passive nature of the gear (Hebert et al., 2001).

Table 4. Bycatch (kg) estimates from the N-ENS and S-ENS Snow Crab fishery. Estimates are extrapolated from At-sea-observed bycatch and biomass of catch (bycatch = [observed biomass of bycatch species / observed landings of Snow Crab] X total landings of Snow Crab). Reliable species specific data beyond 2017 are currently unavailable.

| Species | 2015 | 2016 | 2017 |
| :---------------------: | :-------: | :-------: |:-------: |
|Rock Crab | 19 | 0 | 0 | |Cod | 187 | 84 | 353 | |Jonah Crab | 19 | 854 | 0 | |Northern Stone Crab | 0 | 670 | 18 | |Toad Crab | 0 | 84 | 35 | |Soft Coral | 0 | 0 | 18 | |Basket Star | 0 | 0 | 18 | |Sea Urchin | 0 | 33 | 18 | |Sand Dollars | 0 | 17 | 0 | |Purple Starfish | 0 | 0 | 35 | |Sea Cucumbers | 19 | 50 | 495 | |Whelk | 0 | 17 | 0 | |Winter Flounder | 0 | 0 | 35 | |Eelpout | 0 | 0 | 35 | |Redfish | 75 | 50 | 247 | |Sea Raven | 37 | 33 | 0 | |Skate | 0 | 67 | 18 | |Northern Wolffish | 112 | 17 | 0 | |Spotted Wolffish | 0 | 0 | 194 | |Striped Wolffish | 149 | 100 | 371 | |Total Bycatch | 617 | 2076 | 1890 |

Table 5. Bycatch (kg) estimates from the 4X Snow Crab fishery. Estimates are extrapolated from At-sea-observed bycatch and biomass of catch (bycatch = [observed biomass of bycatch species / observed landings of Snow Crab] X total landings of Snow Crab). Reliable species specific data beyond 2017 are currently unavailable.

| Species | 2015 | 2016 | 2017 |
| :---------------------: | :-------: | :-------: |:-------: |
|American Lobster | 98 | 48 | 55 |
|Cod | 0 | 16 | 0 |
|Jonah Crab | 0 | 16 | 14 | |Rock Crab | 0 | 0 | 14 |
|Lumpfish | 11 | 0 | 0 |
|Northern Stone Crab | 130 | 81 | 82 |
|Redfish | 0 | 0 | 14 | |Sea Raven | 239 | 0 | 41 |
|Total Bycatch | 478 | 161 | 219 |

Stock status

Survey catch rates are are confounded by numerous factors that vary across space and time. Adjustment for these confounding influences were completed with Conditional AutoRegressive SpatioTemporal Models (CARSTM; Choi 2020, Choi et al. 2022 and references therein). The survey was not conducted in 2020 due to Covid-19 related health and safety uncertainties. In 2022, the survey did not complete due to mechanical issues with the survey vessel; inshore areas of S-ENS were most affected (Figure \@ref(fig:survey-locations-map)).

loc = file.path( SCD, "output", "maps", "survey.locations" )
yrsplot = setdiff( year.assessment + c(0:-9), 2020)
fn6 = file.path( loc, paste( "survey.locations", yrsplot[6], "png", sep=".") )
fn5 = file.path( loc, paste( "survey.locations", yrsplot[5], "png", sep=".") )
fn4 = file.path( loc, paste( "survey.locations", yrsplot[4], "png", sep=".") )
fn3 = file.path( loc, paste( "survey.locations", yrsplot[3], "png", sep=".") )
fn2 = file.path( loc, paste( "survey.locations", yrsplot[2], "png", sep=".") )
fn1 = file.path( loc, paste( "survey.locations", yrsplot[1], "png", sep=".") )
include_graphics( c(fn2, fn1) )
# \@ref(fig:survey-locations-map)  

Recruitment

Based on size-frequency histograms of the male Snow Crab population, little to no recruitment is expected for the next 1-3 years in N-ENS (Figure \@ref(fig:sizefeq-male)). In S-ENS, continued moderate levels of recruitment are expected. In 4X, low to moderate levels of recruitment are expected for 2 years.

include_graphics(  file.path( SCD, "assessments", year.assessment, "figures", "size.freq", "survey",  "male.denl.png" )  )
# \@ref(fig:sizefeq-male)

Reproduction

In all areas, there was substantial and continued recruitment of female crab into the mature (egg-bearing) stage of the population from 2016-2022 (Figure \@ref(fig:sizefeq-female)). However, in N-ENS, a decline in numerical densities of both the mature and adolescent components was observed in 2022. Egg and larval production is expected to be moderate to high in the next year in all areas except N-ENS.

include_graphics(  file.path( SCD, "assessments", year.assessment, "figures", "size.freq", "survey",  "female.denl.png" )  )
# \@ref(fig:sizefeq-female)

```r$(no/km$^2$) from the Snow Crab survey.' } loc = file.path( SCD, "output", "maps", "survey", "snowcrab", "annual", "totno.female.mat" ) yrsplot = setdiff( year.assessment + c(0:-9), 2020) fn4 = file.path( loc, paste( "totno.female.mat", yrsplot[4], "png", sep=".") ) fn3 = file.path( loc, paste( "totno.female.mat", yrsplot[3], "png", sep=".") ) fn2 = file.path( loc, paste( "totno.female.mat", yrsplot[2], "png", sep=".") ) fn1 = file.path( loc, paste( "totno.female.mat", yrsplot[1], "png", sep=".") ) include_graphics( c( fn2, fn1) )

\@ref(fig:fmat-map)

## Sex ratios

The sex ratios (proportion female) of the mature component is particularly important as unbalanced ratios can impact reproductive success (Figure \@ref(fig:sexratio-mature)). In the ESS, there is generally a lack of females. The exception being in inshore areas and areas with high bottom slopes (Figure \@ref(fig:sexratio-map)). A decline in sex ratios has been observed since 2017 in N-ENS (Figure \@ref(fig:sexratio-mature)). In S-ENS the sex ratio increased from 20% in 2021 to just under 35% in 2022. In 4X, mature sex ratios are more stable and balanced and currently near the 50% level.  




```r
include_graphics( file.path( SCD, "assessments", year.assessment, "timeseries", "survey", "sexratio.mat.pdf") )
# \@ref(fig:sexratio-mature)
yrsplot = setdiff( year.assessment + c(0:-4), 2020)
loc = file.path( SCD, "output", "maps", "survey", "snowcrab", "annual", "sexratio.mat" )
fn4 = file.path( loc, paste( "sexratio.mat", yrsplot[4], "png", sep=".") )
fn3 = file.path( loc, paste( "sexratio.mat", yrsplot[3], "png", sep=".") )
fn2 = file.path( loc, paste( "sexratio.mat", yrsplot[2], "png", sep=".") )
fn1 = file.path( loc, paste( "sexratio.mat", yrsplot[1], "png", sep=".") )
include_graphics( c( fn2, fn1  ) )
# \@ref(fig:sexratio-map)  

Biomass Density

The fishable component is defined as Snow Crab that are male, mature, and larger than 95 mm CW. The crude, unadjusted, geometric mean fishable biomass density (per unit swept area by the trawl) are shown in Figures \@ref(fig:fbGMTS), and \@ref(fig:fbgeomean-map). A peak in crude biomass densities was observed in 2009 to 2014 and has since been declining in all areas. Note that, high and low biomass density areas fluctuate with time (Figure \@ref(fig:fbgeomean-map)). Biomass density, however, does not equate to total biomass as the areas occupied by crab can contract, expand and shift with environmental conditions and ecosystem change.

fn = file.path(SCD,'assessments',year.assessment,'timeseries','survey','R0.mass.pdf')
include_graphics( c(fn) )
#\@ref(fig:fbGMTS)
loc = file.path( SCD, 'output', 'maps', 'survey', 'snowcrab', 'annual', 'R0.mass')
yrsplot =  setdiff(year.assessment + c(0:-9), 2020 ) 
fn6 = file.path( loc, paste( 'R0.mass', yrsplot[6], 'png', sep='.') )
fn5 = file.path( loc, paste( 'R0.mass', yrsplot[5], 'png', sep='.') )
fn4 = file.path( loc, paste( 'R0.mass', yrsplot[4], 'png', sep='.') )
fn3 = file.path( loc, paste( 'R0.mass', yrsplot[3], 'png', sep='.') )
fn2 = file.path( loc, paste( 'R0.mass', yrsplot[2], 'png', sep='.') )
fn1 = file.path( loc, paste( 'R0.mass', yrsplot[1], 'png', sep='.') )
include_graphics( c(fn2, fn1) )
# \@ref(fig:fbgeomean-map)  

Biomass Index

The fishable biomass index (statistically adjusted for covariates and autocorrelation; Figure \@ref(fig:fbindex-map)) was computed using conditional auto-regressive spatio-temporal models (Choi 2020). This approach models Snow Crab numerical abundance and mean size with environmental (depth, substrate, temperature) and biological factors (species composition) as covariates. Upon aggregation we see that the overall biomass has had several cycles (Figure \@ref(fig:fbindex-timeseries)). Further, the biomass index model infers the spatiotemporal distribution of the biomass density of the fishable component from the covariates measured in that year (Figure \@ref(fig:fbindex-map)); note also the aggregate timeseries with elevated uncertainty for the 2020 estimate (Figure \@ref(fig:fbindex-timeseries)).

loc = file.path( SCD, 'modelled', '1999_present_fb', 'predicted_biomass_densities' )
yrsplot =  year.assessment + c(0:-10)
fn10 = file.path( loc, paste( 'biomass', yrsplot[10], 'png', sep='.') )
fn9 = file.path( loc, paste( 'biomass', yrsplot[9], 'png', sep='.') )
fn8 = file.path( loc, paste( 'biomass', yrsplot[8], 'png', sep='.') )
fn7 = file.path( loc, paste( 'biomass', yrsplot[7], 'png', sep='.') )
fn6 = file.path( loc, paste( 'biomass', yrsplot[6], 'png', sep='.') )
fn5 = file.path( loc, paste( 'biomass', yrsplot[5], 'png', sep='.') )
fn4 = file.path( loc, paste( 'biomass', yrsplot[4], 'png', sep='.') )
fn3 = file.path( loc, paste( 'biomass', yrsplot[3], 'png', sep='.') )
fn2 = file.path( loc, paste( 'biomass', yrsplot[2], 'png', sep='.') )
fn1 = file.path( loc, paste( 'biomass', yrsplot[1], 'png', sep='.') )
include_graphics( c(  fn2, fn1) )
# \@ref(fig:fbindex-map)  
#*Figure XXX. Biomass index log${}_{10}$(t/km${}^2$) predicted from the Snow Crab survey. Note there was no survey in 2020.*
include_graphics( file.path( SCD, 'modelled', '1999_present_fb', 'predicted_biomass_densities', 'biomass_M0.png') )
# \@ref(fig:fbindex-timeseries)

The magnitudes of the biomass index are optimistically high as the spatial expansion uses areal units with large surface areas, on average, much larger than the patchiness of Snow Crab distributions (Choi 2020). As such, it should only be seen as a spatially and temporally consistent relative index of abundance. The spatial distribution of the biomass index has been consistent over the past six years, with a peak in overall biomass index in 2019 and 2020 (Figure \@ref(fig:fbindex-map)). Since then, a reduction in the biomass index was observed throughout the region. Contraction of spatial range in 4X and the western parts of S-ENS were evident in 2021 to 2022. Upon aggregation, the predicted biomass index declined marginally in all areas (Figure \@ref(fig:fbindex-timeseries)).

Modelled Biomass

The biomass index along with fishery removals are used to fit a logistic biomass dynamics model ("Model 1") to determine fishable modelled biomass (Figure \@ref(fig:logisticPredictions)) and relevant biological reference points (i.e., carrying capacity and fishing mortality at maximum sustainable yield, or F~MSY~). In N-ENS, the modelled biomass (pre-fishery) of Snow Crab in r year.assessment was r round(B_north[t0], 2) t, relative to r round(B_north[t1], 2) t in r year_previous. In S-ENS, the r year.assessment modelled biomass (pre-fishery) was r round(B_south[t0], 2) t, relative to r round(B_south[t1], 2) t in r year_previous. In 4X, the modelled biomass (pre-fishery) for the r year.assessment-r year.assessment+1 season was r round(B_4x[t0], 2) t, relative to r round(B_4x[t1], 2) t for the r year_previous-r year.assessment season.

loc = file.path( SCD, 'fishery_model', year.assessment, 'logistic_discrete_historical' )
fn1 = file.path( loc, 'plot_predictions_cfanorth.pdf' ) 
fn2 = file.path( loc, 'plot_predictions_cfasouth.pdf' ) 
fn3 = file.path( loc, 'plot_predictions_cfa4x.pdf' ) 
knitr::include_graphics(c(fn1, fn2, fn3) )
# \@ref(fig:logisticPredictions)

Fishing Mortality

In N-ENS, the r year.assessment fishing mortality is estimated to have been r round(FM_north[t0],3) (annual exploitation rate of r round(100*(exp(FM_north[t0])-1),2)%), up from the r year_previous rate of r round(FM_north[t1],3) (annual exploitation rate of r round(100*(exp(FM_north[t1])-1),1)%; Figure \@ref(fig:logisticFishingMortality)).

In S-ENS, the r year.assessment fishing mortality is estimated to have been r round(FM_south[t0],3) (annual exploitation rate of r round(100*(exp(FM_south[t0])-1),1)%), decreasing marginally from the r year_previous rate of r round(FM_south[t1],3) (annual exploitation rate of r round(100*(exp(FM_south[t1])-1),1)%; Figure \@ref(fig:logisticFishingMortality)). Localized exploitation rates are likely higher, as not all areas for which biomass is estimated are fished (e.g., continental slope areas and western, inshore areas of CFA 24).

In 4X, the r year.assessment-r year.assessment+1 season (ongoing), fishing mortality is estimated to have been r round(FM_4x[t0],3) (annual exploitation rate of r round(100*(exp(FM_4x[t0])-1),1)%), decreasing from the r year.assessment-1-r year.assessment season rate of r round(FM_4x[t1],3) (annual exploitation rate of r round(100*(exp(FM_4x[t1])-1),1)%; Figure \@ref(fig:logisticFishingMortality)). Localized exploitation rates are likely higher, as not all areas for which biomass is estimated are fished.

  odir = file.path( SCD, "fishery_model", year.assessment, "logistic_discrete_historical" )
  fn1 = file.path( odir, "plot_fishing_mortality_cfanorth.pdf" ) 
  fn2 = file.path( odir, "plot_fishing_mortality_cfasouth.pdf" ) 
  fn3 = file.path( odir, "plot_fishing_mortality_cfa4x.pdf" ) 
include_graphics(c(fn1, fn2, fn3) )
# \@ref(fig:logisticFishingMortality)

Reference Points

Reference points are used to guide harvest strategies (Canada Gazette 2022; DFO 2013; Figures \@ref(fig:logistic-hcr), \@ref(fig:logistic-hcr)). Lower and Upper Stock Reference points are 25% and 50% of carrying capacity which delineate "critical", "cautious" and "healthy" zones. The Upper Removal Reference point is the exploitation rate that the fishery tries to stay below; it is defined in terms of the fishing mortality associated with Maximum Sustainable Yield (FMSY). In Model 1, FMSY = $r /2$. As $r \approx 1$ for snow crab, FMSY $\approx 0.5$ is expected.

The operational target exploitation changes depending upon the "zone" in which a population lands. When in the "healthy" zone, the rule of thumb has been to keep annual exploitation rates between 10% to 30% of the available biomass ($F = 0.11, 0.36$, respectively). In the "cautious" zone, the rule of thumb has been to keep annual exploitation rates between 0% to 20% ($F = 0, 0.22$, respectively). In the "critical" zone, fishery closure is considered until recovery is observed, where recovery indicates at a minimum, modelled biomass > LSR. Other biological and ecosystem considerations such as recruitment, spawning stock (female) biomass, size structure, sex ratios and environmental and ecosystem conditions, provide additional guidance within each range.

Table 6. Reference points from the logistic biomass dynamics fishery model (Model 1): K is Carrying capacity (kt); and r is Intrinsic rate of increase (non-dimensional). Note that FMSY (fishing mortality associated with 'Maximum Sustainable Yield') is r/2. Similarly, BMSY (biomass associated with 'Maximum Sustainable Yield') is K/2. SD is posterior Standard deviation.

| | $K$ [SD] | $r$ [SD] | | :---: | :----: | :---: | | N-ENS | r K_north [r K_north_sd] | r r_north [r r_north_sd] | | S-ENS | r K_south [r K_south_sd] | r r_south [r r_south_sd] | | 4X | r K_4x [r K_4x_sd] | r r_4x [r r_4x_sd] |

The current estimates of key Reference Points from Model 1 are shown in Table 6 and Figure \@ref(fig:ReferencePoints). The related PA thresholds can be computed as:

The current state of the fishable components and the above landmarks from Model 1 (Figure \@ref(fig:logistic-hcr)) suggests that:

include_graphics( file.path( params$media_loc, 'harvest_control_rules.png') ) 
# \@ref(fig:ReferencePoints)
  odir = file.path( SCD, 'fishery_model', year.assessment, 'logistic_discrete_historical' )
  fn1 = file.path( odir, 'plot_hcr_cfanorth.pdf' ) 
  fn2 = file.path( odir, 'plot_hcr_cfasouth.pdf' ) 
  fn3 = file.path( odir, 'plot_hcr_cfa4x.pdf' ) 
  include_graphics(c(fn1, fn2, fn3) )
#  \@ref(fig:logistic-hcr)

It should be noted that using these parameters assume that the population dynamics are well described by the fishery model. This is, of course, not true. For example, the observation of fisheries landings is assumed to be known without error. This is not true as illegal and unreported exploitation occurs. These and other unaccounted factors can easily bias parameter estimates. As such, caution is required in using these reference points. Other contextual reference points must be used in conjunction:

Ecosystem Considerations

Bottom Temperature

A general warming trend has been observed in the Snow Crab survey since the early 1990s on the Scotian Shelf (Choi et al. 2022). Temperatures are more stable in N-ENS than S-ENS; 4X exhibits the most erratic and highest annual mean bottom temperatures. The average temperature is found to have increased well beyond the $7^\circ$C threshold in 4X. N-ENS and S-ENS also continued to experience historical highs in bottom temperature and elevated spatial variability of bottom temperatures (Figures \@ref(fig:bottom-temperatures), \@ref(fig:bottom-temperatures-map)).

include_graphics( file.path( SCD, 'assessments', year.assessment, 'timeseries', 'temperature_bottom.pdf') )
# \@ref(fig:bottom-temperatures)
loc = file.path( data_root, 'aegis', 'temperature', 'maps', '1999_present' )
yrsplot =  year.assessment + c(0:-10)
fn10 = file.path( loc, paste( 'Bottom-temperature-',  yrsplot[10], '-0.75',  '.png', sep='') )
fn9  = file.path( loc, paste( 'Bottom-temperature-',  yrsplot[9],  '-0.75',  '.png', sep='') )
fn8  = file.path( loc, paste( 'Bottom-temperature-',  yrsplot[8],  '-0.75',  '.png', sep='') )
fn7  = file.path( loc, paste( 'Bottom-temperature-',  yrsplot[7],  '-0.75',  '.png', sep='') )
fn6  = file.path( loc, paste( 'Bottom-temperature-',  yrsplot[6],  '-0.75',  '.png', sep='') )
fn5  = file.path( loc, paste( 'Bottom-temperature-',  yrsplot[5],  '-0.75',  '.png', sep='') )
fn4  = file.path( loc, paste( 'Bottom-temperature-',  yrsplot[4],  '-0.75',  '.png', sep='') )
fn3  = file.path( loc, paste( 'Bottom-temperature-',  yrsplot[3],  '-0.75',  '.png', sep='') )
fn2  = file.path( loc, paste( 'Bottom-temperature-',  yrsplot[2],  '-0.75',  '.png', sep='') )
fn1  = file.path( loc, paste( 'Bottom-temperature-',  yrsplot[1],  '-0.75',  '.png', sep='') )
include_graphics( c( fn2, fn1) )
# \@ref(fig:bottom-temperatures-map)

Viable habitat

Snow Crab being cold water stenotherms, stability of environmental conditions is critical for their survival. The Maritimes Region being at the confluence of many oceanic currents renders the area highly variable. Rapid climate change and uncertainty exacerbates this situation. The viable habitat estimated for each area across time has shown some variations (Figures \@ref(fig:fb-habitat-timeseries), \@ref(fig:fb-habitat-map)) in the historical record. As can be seen, 4X showed a significantly lower average viable habitat levels relative to the N-ENS and S-ENS. A peak in average probability of observing fishable snow crab ("viable habitat") was observed in 2010 for 4X, 2011 for N-ENS and 2012 for S-ENS. Since 2015, the average viable habitat has declined to historical lows and remained so in 2022.

loc = file.path( SCD, 'modelled', '1999_present_fb', 'aggregated_habitat_timeseries' )
include_graphics( file.path( loc, 'habitat_M0.png') )
# \@ref(fig:fb-habitat-timeseries)
loc = file.path( SCD, 'modelled', '1999_present_fb', 'predicted.presence_absence' )
yrsplot =  year.assessment + c(0:-10)
fn10 = file.path( loc, paste( 'Predicted_presence_absence_', yrsplot[10], '.png', sep='') )
fn9 = file.path( loc, paste( 'Predicted_presence_absence_', yrsplot[9], '.png', sep='') )
fn8 = file.path( loc, paste( 'Predicted_presence_absence_', yrsplot[8], '.png', sep='') )
fn7 = file.path( loc, paste( 'Predicted_presence_absence_', yrsplot[7], '.png', sep='') )
fn6 = file.path( loc, paste( 'Predicted_presence_absence_', yrsplot[6], '.png', sep='') )
fn5 = file.path( loc, paste( 'Predicted_presence_absence_', yrsplot[5], '.png', sep='') )
fn4 = file.path( loc, paste( 'Predicted_presence_absence_', yrsplot[4], '.png', sep='') )
fn3 = file.path( loc, paste( 'Predicted_presence_absence_', yrsplot[3], '.png', sep='') )
fn2 = file.path( loc, paste( 'Predicted_presence_absence_', yrsplot[2], '.png', sep='') )
fn1 = file.path( loc, paste( 'Predicted_presence_absence_', yrsplot[1], '.png', sep='') )
include_graphics( c(  fn2, fn1) )
# \@ref(fig:fb-habitat-map)  

Viable habitat in a stage-dependent model

A complementary modelling approach ("Model 2") has been developed Choi (2023). It is a six-component system (five male stages from instar 9 [40.9-55.1mm], 10 [55.1-74.4mm], 11 [74.4-95mm], immature [95mm+], mature [95mm+] and mature females) delay differential model, where each component has a molt and/or birth from a previous stage in balance with a constant (first order) background death rate; a second death rate associated with varying levels of viable habitat (second order, similar to the logistic form); and fishing mortality, assumed to be known without error. Model 2 suggests population trends that are mostly comparable with Model 1 (Figure \@ref(fig:dde-predictions-everything)). However, overall biomass is estimated to be lower which results in fishing mortality estimates being higher (Figure \@ref(fig:dde-fishing-mortality)).

  fn1 = file.path( loc_dde, "plot_predictions_everything_cfanorth.pdf" ) 
  fn2 = file.path( loc_dde, "plot_predictions_everything_cfasouth.pdf" ) 
  fn3 = file.path( loc_dde, "plot_predictions_everything_cfa4x.pdf" ) 
  include_graphics(c(fn1, fn2, fn3) )
  # \@ref(fig:dde-predictions-everything)
  fn1 = file.path( loc_dde, "plot_fishing_mortality_cfanorth.pdf" ) 
  fn2 = file.path( loc_dde, "plot_fishing_mortality_cfasouth.pdf" ) 
  fn3 = file.path( loc_dde, "plot_fishing_mortality_cfa4x.pdf" ) 
  include_graphics(c(fn1, fn2, fn3) )
  # \@ref(fig:dde-fishing-mortality)

Fishing mortality estimates from Model 2 (Figure \@ref(fig:dde-fishing-mortality)) have an overall form that is similar to those of Model 1 (Figure \@ref(fig:logisticFishingMortality)). As with Model 1, Model 2 suggests peak fishing mortality likely occurred in N-ENS in 2005 and earlier. After strong and difficult reductions, it has slowly increased over time. In S-ENS, it has been more stable and conservative throughout the timeseries. In 4X, prior to formal assessments beginning in 2005, fishing mortality was likely to have been high, but has since declined to a range consistent with the other regions.

The important difference between the two models is that Model 2 suggests fishing mortality rates are higher in magnitude than those of Model 1. Model 2 estimates of fishing mortality rate for N-ENS in the r year.assessment was r round(ddeFM_north[t0],2) (annual exploitation rate of r round(100*(exp(ddeFM_north[t0])-1),2)%), up from the r year_previous rate of r round(ddeFM_north[t1],1) (annual exploitation rate of r round(100*(exp(ddeFM_north[t1])-1),1)%). In S-ENS, the r year.assessment fishing mortality was r round(ddeFM_south[t0],2) (annual exploitation rate of r round(100*(exp(ddeFM_south[t0])-1),1)%), down slightly from the r year_previous rate of r round(ddeFM_south[t1],2) (annual exploitation rate of r round(100*(exp(ddeFM_south[t1])-1),1)%). In 4X, the r year.assessment-r year.assessment+1 season (ongoing) fishing mortality was r round(ddeFM_4x[t0],2) (annual exploitation rate of r round(100*(exp(ddeFM_4x[t0])-1),1)%), down from the r year_previous-r year.assessment season rate of r round(ddeFM_4x[t1],2) (annual exploitation rate of r round(100*(exp(ddeFM_4x[t1])-1),1)%).

Model 2 does not have a concept of FMSY as there is no stable solution to such an externally perturbed system (viable habitat). The FMSY from Model 1 in theory should be approximately 0.5. If this is accepted, then we can see that N-ENS was close to this threshold in 2022. The stock status can be seen in an equivalent format as for Model 1 (Figure \@ref(fig:dde-hcr)).

  fn1 = file.path( loc_dde, "plot_hcr_cfanorth.pdf" ) 
  fn2 = file.path( loc_dde, "plot_hcr_cfasouth.pdf" ) 
  fn3 = file.path( loc_dde, "plot_hcr_cfa4x.pdf" ) 
  include_graphics(c(fn1, fn2, fn3) )
  # \@ref(fig:dde-hcr)

Fishery footprint (Figures \@ref(fig:dde-footprint-trace)) represents the change in abundance between the orange lines (Figure \@ref(fig:dde-predictions-everything)) where fishing occurred, with the green lines: the abundance that might have been if fishing did not occur. Fishery footprint has been to depress potential abundance by 25% to 50% in N-ENS since 2010. In S-ENS, the fisheries footprint has been stable between 10% to 30%. Area 4X footprint has declined from over 50% in the pre-2010 period to now a value of less than 25%. The fisheries footprint of all areas are now in a stable and robustly precautionary state, with the exception of N-ENS.

The current estimates of some key parameters derived from the six-component model are shown in Table 7. The estimate of carrying capacity is different. As with Model 1, N-ENS and S-ENS are still considered in the "healthy" zone. However, Model 2 suggests that 4X may still be in the "healthy" zone, though still close to the "cautious" zone. Reality is likely somewhere in between the two Models representations.

Table 7. Reference points from Model 2. K is Carrying capacity in biomass (kt); and b is "birth" rate of mature females (non-dimensional).

| | $K$ [SD] | $b$ [SD] | | :---: | :----: | :---: | | N-ENS | r Kdde_north [r Kdde_north_sd] | r bdde2_north [r bdde2_north_sd] | | S-ENS | r Kdde_south [r Kdde_south_sd] | r bdde2_south [r bdde2_south_sd] | | 4X | r Kdde_4x [r Kdde_4x_sd] | r bdde2_4x [r bdde2_4x_sd] |

Forward projections at different levels of harvest relative to 2022 TACs suggest that all areas can expect some reduction in abundance (Figure \@ref(fig:projections-fb)) and an increase in the fishery footprint (Figure \@ref(fig:projections-footprint)). In N-ENS, all scenarios (80%, 100%, 120% of r year.assessment's TAC, suggest fishery footprint is at risk of exceeding 50%.

These results from Model 2 are supplementary in nature to provide additional context. Their direct use in defining reference point thresholds is not recommended at this point.

\clearpage

  fn1 = file.path( loc_dde, "plot_footprint_trace_cfanorth.pdf" ) 
  fn2 = file.path( loc_dde, "plot_footprint_trace_cfasouth.pdf" ) 
  fn3 = file.path( loc_dde, "plot_footprint_trace_cfa4x.pdf" ) 
  include_graphics(c(fn1, fn2, fn3) )
  # \@ref(fig:dde-footprint-trace)
  fn1 = file.path( loc_dde, "plot_trace_projections_cfanorth__0.8__.pdf" ) 
  fn2 = file.path( loc_dde, "plot_trace_projections_cfasouth__0.8__.pdf" ) 
  fn3 = file.path( loc_dde, "plot_trace_projections_cfa4x__0.8__.pdf" ) 
  fn4 = file.path( loc_dde, "plot_trace_projections_cfanorth__1.0__.pdf" ) 
  fn5 = file.path( loc_dde, "plot_trace_projections_cfasouth__1.0__.pdf" ) 
  fn6 = file.path( loc_dde, "plot_trace_projections_cfa4x__1.0__.pdf" ) 
  fn7 = file.path( loc_dde, "plot_trace_projections_cfanorth__1.2__.pdf" ) 
  fn8 = file.path( loc_dde, "plot_trace_projections_cfasouth__1.2__.pdf" ) 
  fn9 = file.path( loc_dde, "plot_trace_projections_cfa4x__1.2__.pdf" ) 
  include_graphics(c(fn1, fn2, fn3, fn4, fn5, fn6, fn7, fn8, fn9) )
  # \@ref(fig:projections-fb)
  fn1 = file.path( loc_dde, "plot_trace_footprint_projections_cfanorth__0.8__.pdf" ) 
  fn2 = file.path( loc_dde, "plot_trace_footprint_projections_cfasouth__0.8__.pdf" ) 
  fn3 = file.path( loc_dde, "plot_trace_footprint_projections_cfa4x__0.8__.pdf" ) 
  fn4 = file.path( loc_dde, "plot_trace_footprint_projections_cfanorth__1.0__.pdf" ) 
  fn5 = file.path( loc_dde, "plot_trace_footprint_projections_cfasouth__1.0__.pdf" ) 
  fn6 = file.path( loc_dde, "plot_trace_footprint_projections_cfa4x__1.0__.pdf" ) 
  fn7 = file.path( loc_dde, "plot_trace_footprint_projections_cfanorth__1.2__.pdf" ) 
  fn8 = file.path( loc_dde, "plot_trace_footprint_projections_cfasouth__1.2__.pdf" ) 
  fn9 = file.path( loc_dde, "plot_trace_footprint_projections_cfa4x__1.2__.pdf" ) 
  include_graphics(c(fn1, fn2, fn3, fn4, fn5, fn6, fn7, fn8, fn9) )
  # \@ref(fig:projections-footprint)

\clearpage

Predators, preys, competitors

Being long-lived, the influence of predators can be significant. Especially important are predators of the smaller immature and female Snow Crab. Increasing predation not only lowers the abundance and recruitment, it can also reduce the reproductive potential of Snow Crab and therefore long-term population cycles. N-ENS and S-ENS are well known to have skewed sex ratios with few mature females for extended periods of time, quite possibly linked to differential predation mortality (mature females being much smaller and full of fat-rich gonads and eggs).

Based on stomach sampling, Atlantic Halibut, Atlantic Wolffish, Thorny Skate, and other skate species are known predators of Snow Crab. Large Atlantic Halibut with mature female Snow Crab in their stomachs have been reported. Anecdotal information of some seals having fed upon Snow Crab are also known.

Some of these predators (e.g., Halibut; DFO 2018) have significantly increased in abundance in the Region. However, for all, the abundance and encounter rates in areas overlapping with snow crab habitat what is more important, but this is not known. We do know from the bycatch in the Snow Crab survey that there are elevated areal densities with many snow crab trawl samples. This means that encounter rates will also likely increase and so too potentially predation mortality. However, high density does not equate to high abundance nor high total predation mortality; but this remains unknown and requires further analysis. The following presents information of areal density of co-occuring species; they are potential predators, competitors and prey.

Atlantic Halibut densities have increased rapidly since 2010 (Figure \@ref(fig:halibut-timeseries); DFO 2018) on Snow Crab grounds. Most of these increases were towards The Gully, Slope Edge and near Sable Island (\@ref(fig:halibut-map)).

Thorny skate densities have been increasing as well (Figure \@ref(fig:thornyskate-timeseries)), especially in N-ENS and along the margins of Banquereau Bank (Figure \@ref(fig:thornyskate-map)). A minor decline in the densities have been seen in 4X.

Striped Atlantic Wolffish densities have been high, though declining in N-ENS since 2007 (Figure \@ref(fig:Wolffish-timeseries)). Highest densities were towards the Laurentian Channel (Figure \@ref(fig:Wolffish-map)).

Northern shrimp co-occur as they share similar habitat preferences and are also potential prey items of Snow Crab. Their numerical densities have declined after a peak in 2011, especially in S-ENS (Figures \@ref(fig:Shrimp-timeseries), \@ref(fig:Shrimp-map)).

Lesser toad crab is a co-occurring species and potential competitor. Their numbers have declined to low levels throughout, after a peak in densities in 2007 and 2016 in N-ENS (Figures \@ref(fig:lessertoadcrab-timeseries), \@ref(fig:lessertoadcrab-map)).

Overall, higher predation mortality seems likely in N- and S-ENS and lower in 4X. Further co-occurring species have declined, possibly due to large-scaled habitat variations.

include_graphics( file.path( SCD, 'assessments', year.assessment, 'timeseries', 'survey', 'ms.no.30.pdf') )
# \@ref(fig:halibut-timeseries)
loc = file.path( SCD, 'output', 'maps', 'survey', 'snowcrab', 'annual', 'bycatch', 'ms.no.30' )
yrsplot = setdiff( year.assessment + c(0:-9), 2020)
fn4 = file.path( loc, paste( 'ms.no.30', yrsplot[4], 'png', sep='.') )
fn3 = file.path( loc, paste( 'ms.no.30', yrsplot[3], 'png', sep='.') )
fn2 = file.path( loc, paste( 'ms.no.30', yrsplot[2], 'png', sep='.') )
fn1 = file.path( loc, paste( 'ms.no.30', yrsplot[1], 'png', sep='.') )
include_graphics( c( fn2, fn1) )
# \@ref(fig:halibut-map)  
include_graphics( file.path( SCD, 'assessments', year.assessment, 'timeseries', 'survey', 'ms.no.201.pdf') )
# \@ref(fig:thornyskate-timeseries)
loc = file.path( SCD, 'output', 'maps', 'survey', 'snowcrab', 'annual', 'bycatch', 'ms.no.201' )
yrsplot = setdiff( year.assessment + c(0:-9), 2020)
fn4 = file.path( loc, paste( 'ms.no.201', yrsplot[4], 'png', sep='.') )
fn3 = file.path( loc, paste( 'ms.no.201', yrsplot[3], 'png', sep='.') )
fn2 = file.path( loc, paste( 'ms.no.201', yrsplot[2], 'png', sep='.') )
fn1 = file.path( loc, paste( 'ms.no.201', yrsplot[1], 'png', sep='.') )
include_graphics( c(  fn2, fn1) )
# \@ref(fig:thornyskate-map)  
include_graphics( file.path( SCD, 'assessments', year.assessment, 'timeseries', 'survey', 'ms.no.50.pdf') )
# \@ref(fig:Wolffish-timeseries)
loc = file.path( SCD, 'output', 'maps', 'survey', 'snowcrab', 'annual', 'bycatch', 'ms.no.50' )
yrsplot = setdiff( year.assessment + c(0:-9), 2020)
fn4 = file.path( loc, paste( 'ms.no.50', yrsplot[4], 'png', sep='.') )
fn3 = file.path( loc, paste( 'ms.no.50', yrsplot[3], 'png', sep='.') )
fn2 = file.path( loc, paste( 'ms.no.50', yrsplot[2], 'png', sep='.') )
fn1 = file.path( loc, paste( 'ms.no.50', yrsplot[1], 'png', sep='.') )
include_graphics( c( fn2, fn1) )
# \@ref(fig:Wolffish-map)  
include_graphics( file.path( SCD, 'assessments', year.assessment, 'timeseries', 'survey', 'ms.no.2211.pdf') )
# \@ref(fig:Shrimp-timeseries)
loc = file.path( SCD, 'output', 'maps', 'survey', 'snowcrab', 'annual', 'bycatch', 'ms.no.2211' )
yrsplot = setdiff( year.assessment + c(0:-9), 2020)
fn4 = file.path( loc, paste( 'ms.no.2211', yrsplot[4], 'png', sep='.') )
fn3 = file.path( loc, paste( 'ms.no.2211', yrsplot[3], 'png', sep='.') )
fn2 = file.path( loc, paste( 'ms.no.2211', yrsplot[2], 'png', sep='.') )
fn1 = file.path( loc, paste( 'ms.no.2211', yrsplot[1], 'png', sep='.') )
include_graphics( c( fn2, fn1) )
# \@ref(fig:Shrimp-map)  
include_graphics( file.path( SCD, 'assessments', year.assessment, 'timeseries', 'survey', 'ms.no.2521.pdf') )
# \@ref(fig:lessertoadcrab-timeseries)
loc = file.path( SCD, 'output', 'maps', 'survey', 'snowcrab', 'annual', 'bycatch', 'ms.no.2521' )
yrsplot = setdiff( year.assessment + c(0:-9), 2020)
fn4 = file.path( loc, paste( 'ms.no.2521', yrsplot[4], 'png', sep='.') )
fn3 = file.path( loc, paste( 'ms.no.2521', yrsplot[3], 'png', sep='.') )
fn2 = file.path( loc, paste( 'ms.no.2521', yrsplot[2], 'png', sep='.') )
fn1 = file.path( loc, paste( 'ms.no.2521', yrsplot[1], 'png', sep='.') )
include_graphics( c(  fn2, fn1) )
# \@ref(fig:lessertoadcrab-map)  

Other sources of uncertainty

All of the above uncertainties are human induced and unlike the larger scaled climatic and ecosystemic uncertainties, there is some measure of human intervention possible.

To remain adaptive in the face of these and other as yet unknown uncertainties including the ecosystemic, climatic uncertainties of which we are already aware, is the true challenge. It requires a balance of both resilience and robustness (see, Choi and Patten 2001). The Precautionary Approach as practiced by the snow crab fishers in Maritimes Region represents a unique model of such an adaptive approach. It values qualitity information and the communication and discussion of approaches in a distributed, collective information network that goes well beyond the simplistic and potentially maladaptive rubric of a purely "reference-points" based approach. Continued vigilence is necessary.

CONCLUSIONS AND ADVICE

The ESS ecosystem is still experiencing a lot of volatility driven by rapid ecosystem and climatic variations. Under such conditions, it is prudent to be careful. Further, the overall indications of population status suggest that Snow Crab are still able to persist under extreme conditions if they are episodic, albeit, with some shifts in spatial distribution towards cooler and deeper waters.

The modelled solutions represent a few of many possible views of the dynamics of snow crab. Over-emphasis of any one of these modelled solutions and associated Reference Points in determining a strategy for fisheries management is not prudent and certainly not precautionary.

REFERENCES

Canada Gazette. 2022. Regulations Amending the Fishery (General) Regulations. Part II, Volume 156, Number 8.

Canada Gazette. 2016. St. Anns Bank Marine Protected Area Regulations. Canada Gazette, Part I, Vol 150, Issue 51: 4143-4149. Choi, J.S. 2020. A Framework for the assessment of Snow Crab (Chioneocete opilio) in Maritimes Region (NAFO Div 4VWX) . DFO Can. Sci. Advis. Sec. Res. Doc. 2020/nnn. v + xxx p.

Choi, J.S. 2022. Reconstructing the Decline of Atlantic Cod with the Help of Environmental Variability in the Scotian Shelf of Canada. bioRxiv. https://doi.org/10.1101/2022.05.05.490753.

Choi, J. S., and B. C. Patten. 2001. Sustainable Development: Lessons from the Paradox of Enrichment. Ecosystem Health 7: 163–77.

Choi, Jae S., B. Cameron, K. Christie, A. Glass, and E. MacEachern. 2022. Temperature and Depth Dependence of the Spatial Distribution of Snow Crab. bioRxiv. https://doi.org/10.1101/2022.12.20.520893.

Choi, Jae S. 2023. A Multi-Stage, Delay Differential Model of Snow Crab Population Dynamics in the Scotian Shelf of Atlantic Canada. bioRxiv. https://doi.org/10.1101/2023.02.13.528296.

DFO. 2013. Integrated Fisheries Management Plan for Eastern Nova Scotia and 4X Snow Crab (Chionoecetes Opillio.)

DFO. 2018. Stock Status Update of Atlantic Halibut (Hippoglossus hippoglossus) on the Scotian Shelf and Southern Grand Banks in NAFO Divisions 3NOPs4VWX5Zc. DFO Can. Sci. Advis. Sec. Sci. Resp. 2018/022.

Hebert M, Miron G, Moriyasu M, Vienneau R, and DeGrace P. Efficiency and ghost fishing of Snow Crab (Chionoecetes opilio) traps in the Gulf of St. Lawrence. Fish Res. 2001; 52(3): 143-153. 10.1016/S0165-7836(00)00259-9

  detach(sn_env)


jae0/snowcrab documentation built on Feb. 27, 2024, 2:42 p.m.