cm <- readRDS("cur_model_resilient_mine.rds")

From the gear parameters we see that this model is using the generic gear where l50 is set to l_mat/2

weight_to_length <- function(w, params) {
    a <- species_params(params)$a
    b <- species_params(params)$b
    (w / a) ^ (1 / b)
}

l_mat = weight_to_length(species_params(cm)$w_mat, cm)

gear_params(cm)$l50 == l_mat/2
##  [1] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE

Elyza has adusted the reproduction levels

getReproductionLevel(cm)
##     smallfish         ruffe        breams         roach         vimba 
##     0.9367125     0.7494209     0.9473834     0.7908168     0.9569967 
##     carassius         perch     pikeperch        burbot predator_fish 
##     0.8337738     0.4000000     0.3000000     0.9911825     0.9997412

This has led to nice yield curves:

plotYieldCurve(cm, species = 1, F_max = 2)

plotYieldCurve(cm, species = 2, F_max = 1)

plotYieldCurve(cm, species = 3, F_max = 1)

plotYieldCurve(cm, species = 4, F_max = 1)

plotYieldCurve(cm, species = 5, F_max = 0.5)

plotYieldCurve(cm, species = 6, F_max = 0.5)

plotYieldCurve(cm, species = 7, F_max = 0.5)

plotYieldCurve(cm, species = 8, F_max = 0.5)

plotYieldCurve(cm, species = 9, F_max = 0.5)

plotYieldCurve(cm, species = 10, F_max = 0.5)