This dataset have been constructed and used for scientific purpose, available in the paper “Detecting the effects of inter-annual and seasonal changes of environmental factors on the the striped red mullet population in the Bay of Biscay” authored by Kermorvant C., Caill-Milly N., Sous D., Paradinas I., Lissardy M. and Liquet B. and published in Journal of Sea Research.

This file is an extraction from the SACROIS fisheries database created by Ifremer (for more information see https://sextant.ifremer.fr/record/3e177f76-96b0-42e2-8007-62210767dc07/) and from the Copernicus database. Biochemestry comes from the product GLOBAL_ANALYSIS_FORECAST_BIO_001_028 (https://resources.marine.copernicus.eu/?option=com_csw&view=details&product_id=GLOBAL_ANALYSIS_FORECAST_BIO_001_028). Temperature and salinity comes from GLOBAL_ANALYSIS_FORECAST_PHY_001_024 product (https://resources.marine.copernicus.eu/?option=com_csw&view=details&product_id=GLOBAL_ANALYSIS_FORECAST_PHY_001_024).

As fisheries landing per unit of effort is only available per ICES rectangle and by month, environmental data have been aggregated accordingly.

Colomns description

library(forecast)
library(dplyr)
library(mgcv)
library(ggplot2)
#download.file("https://www.seanoe.org/data/00660/77179/data/78596.csv", destfile="./data_rougets.csv")

data_rougets <- read.csv("data_rougets.csv",header=T,sep=" ")
str(data_rougets)
R20E8 <- data_rougets %>%
  dplyr::filter(rectangle == "R20E8")

R20E8_ts <-  ts(R20E8$Poids, start = c(2005, 1), frequency = 12)
autoplot(R20E8_ts) + ggtitle("Série de pêche initiale pour le rectangle R20E8") + ylab("Poids mensuel pêché")

Décomposition

R20E8 <- data_rougets %>%
  filter(rectangle == "R20E8") %>%
  select(Med) %>%
  ts(start = 2005, frequency = 12)
 
stl(R20E8,t.window=15,s.window="periodic", robust=TRUE) 

R20E8 %>%
  autoplot()