gavinfay / fluke-mafmc-recdisc

Code for runnning analyses for the 2021 MAFMC Summer Flounder MSE focused on recreational discards
3 stars 3 forks source link

Dot-line plots for states showing medians for all OMs. #10

Open gavinfay opened 1 year ago

gavinfay commented 1 year ago

Recreate fishery-wide view with medians across OMs, but in tabbable form for each state.

gavinfay commented 1 year ago

@tbreault create tabbed view of dot-line plots of medians by state, can use the code in summary metrics.Rmd circa lines 161-202 (below) but with the state metrics. Suggest re-using some of the state boxplot code (in the same Rmd).

`

metrics across MPs for all oms

p2 <- summary_metrics %>% 
  mutate(om = factor(om),
         om = fct_recode(om, "base" = "1","MRIP bias" = "2","shift" = "3"),
         metric = factor(metric, levels = c("keep_one",
                                            "kept_per_trip_mp1",
                                            "cs_per_trip",
                                            "trophy",
                                            "keep_one_mp1",
                                            "keep_one_range_mp1",
                                            "kept:rel_mp1",
                                            "kept:rel_range_mp1",
                                            "not overfished",
                                            "not overfishing",
                                            "ssb_mp1",
                                            "rel_per_trip_mp1",
                                            "rec_removals_mp1",
                                            "prop_female",
                                            "ntrips_mp1",
                                            "change_cs"#,
                                            #"gdp_mp1"
                                            ))) %>% 
  #filter(om == 1) %>% 
  ggplot() +
  aes(x = mp, y = value, col = mp, shape = om) +
  #geom_boxplot(outlier.shape=NA) +
  geom_point() +
  geom_line(aes(x = mp, y = value, group = om), col = "gray") +
  geom_point() + 
  scale_color_brewer(type = "qual", palette = 2) +
  facet_wrap(~metric, scale = "free_y", drop = F) +
  ylab("") +
  xlab("") +
  theme_bw() +
  theme(legend.position = "bottom",
        axis.text.x = element_blank()) +
  labs(fill = "") +
  guides(col = guide_legend(nrow = 2),
         shape = guide_legend(nrow = 2))
p2

`