Introduction

The Operating Model is based on the ICES stock assessment that was available at the start of the project (ICES2022mac?). All coding is done using R (R?) and FLR (kell2007flr?) in Rmarkdown (Rmdbook?), and summarised in as a vignette. The information (data, files, etc.) required to re-do the analysis, is available at ???, including the ICES assessment data set, and the inputs and outputs from the ecosystem models.

Code for cleaning the input data, and R libraries used for the analysis, are contained in the ‘Rmd’ files such as this one. Only Key steps in the analysis are shown in the documents generated, code used for plotting are not echoed in the output but can be found in the ‘Rmd’ file.

Advantages of making the research reproducible in ‘Rmd’ are that it is easier for others to check it, adjustments to be made to the code, data updated, before publishing analysis can be checked row cleaning the raw data through to generating final figures and tables, the analysis can be shared with others and code examples can be provided to other who wish to extend the research.

This vignette is divided into sections for Installation of the required libraries, sourcing bespoke functions, and loading the data, before the ICES Assessment is ran and summarised.

Details on Funding, Software Versions andReferences can be found at the end of the document.

Installation

Libraries (i.e. packages) can be installed from gihtub using the remotes package:

install.packages("remotes")

library(remotes)

install.packages("ggplot2")
install.packages("plyr")

remotes::install_github("flr/FLCore")
remotes::install_github("flr/ggplotFL")

install.packages("RTMB")

remotes::install_github('fishfollower/SAM/stockassessment', ref='components')
remotes::install_github("flr/FLfse/FLfse")
library(FLCore) 
library(ggplotFL)
library(FLAssess)

library(plyr)

library(stockassessment)
library(FLfse)

theme_set(theme_bw(16))

Bespoke functions

Functions are used to run key parts of the analysis, this makes it easier to document and debug code, and replicate key steps. The ICES assessment is run uisng the function ‘runSam’, this means that the assessment can be redone in a comparable way when new data become available or based on alternative hypotheses, and steps are documented.

source("../R/runSam.R")  

Back to Top

ICES Assessment

Reference Points

ICES advice framework is based on achieving maximum sustainable yield (\(MSY\)) and the precautionary approach (\(PA\)).

For \(MSY\) reference points provided are \(MSY_{Btrigger}\) set equal to \(B_{pa}\), and \(F_{MSY}\) from stochastic simulations Reference points (ICES2023macmse?). PA reference points are \(B_{lim}\) (equal to \(B_{loss}\)), \(B_{pa}\) (\(B_{lim}e^{1.65\sigma}\), where sigma = 0.15), \(F_{lim}\) (the \(F\) that will generate \(B_{lim}\)), and \(F_{pa}\) (based on the\(F\) that provides a \(95\%\) chance that \(SSB \gt B_{lim}\)).

Reference point are updated at a benchmark and therefore may change

load("../data/inputs/ices/icesRefs.RData")

Figure 1 ICES reference points

ICES Advice Rule

The ICES advice rule is implemented as a harvest control rule (HCR) based on two biomass reference points, \(MSY_{Btrigger}\) a trigger reference point, \(B_{lim}\) and a limit reference point (ICES2022ar?). ICES recommends that the two biomass reference should depend on each other, e.g. be fractions or multiples of a common reference point such as like \(B_{MSY}\). Although in the ICES system \(B_{MSY}\) is not defined, and limits, thresholds and targets have different objectives, i.e. limits should be avoided with high probability, thresholds are a warning that something should be done before something bad happens, and a target is something that should be achieved on average.

To ensure robustness, i.e. that objectives are met despite uncertainty limits, thresholds and targets should ideally be independent of each other. For example, when information is incomplete and the variables of interest are latent, however, as in stock assessment there is often sufficient information to estimate key parameters. For example, in an age-based assessment, the production function and hence \(MSY\) reference points are largely determined by fixed parameters (e.g. natural mortality, steepness and growth and fecundity-at-age, mangel2013perspective?) and alternative choices may provide equally good fits .

Figure 2 Harvest Control Rule that implements the ICES advice rule.

Assessment

Historical estimates of spawning stock biomass (SSB), fishing mortality (F), catch and recruitment, along with the recen estimates of \(MSY_{Btrigger}\), \(F_{MSY}\), \(B_{lim}\), \(B_{pa}\), and \(F_{lim}\).

The assessment is rerun using the ‘runSam’ script, from the assessment working group

ices   =runSam("nm",dir="../data/inputs/ices")[[1]]

Figure 3 Historical stock trends with reference points.

Back to Top

Software Version

Back to Top

Funding

Back to Top

References

Back to Top