Caricamento pacchetti:

library(dplyr)
library(ggplot2)
library(knitr)

Parte 1 : Dati

Il dataset della FAO scaricabile da qui : https://www.fao.org/platform-food-loss-waste/flw-data/en/ contiene dati su studi e analisi scientifiche inerenti lo spreco alimentare nel mondo dal 2000 al 2022 . In particolare è costituito da 29.287 obs. di 18 variabili. Le variabili che si prendono in considerazione per l’analisi sono :

Caricamento dati:

Data <- read.csv("Data.csv", stringsAsFactors = TRUE)

## lets drop duplicates:
sum(duplicated(Data))
## [1] 161
Data <- distinct(Data)

Parte 2 : Domanda di ricerca

Si vuole evidenziare che in Europa (7,54% di perdite), in Italia (23,7% di perdite) e nel mondo intero (27,66% di perdite) le cause dello spreco alimentare riguardano il fatto che molti produttori, trasportatori e rivenditori sono soggetti a rigorosi standard di qualità che devono essere soddisfatti, e questo può comportare il rigetto di prodotti che non soddisfano tali standard, anche se sono ancora commestibili. Inoltre, la logistica del trasporto e della distribuzione dei prodotti alimentari può essere complessa e può comportare la perdita di prodotti durante il trasporto o la conservazione e infine nelle aree geografiche dove c’è un maggiore benessere economico come l’Europa e il Nord America lo spreco maggiore di cibo si ha da parte delle famiglie . In media nel mondo sono la post raccolta e le famiglie che creano il maggiore spreco di cibo per le suddette motivazioni.

Part3 3: Esplorazione dei dati

Aree geografiche :

Data %>%
  filter(country %in% c("Africa","Asia","Central Asia","Europe","Latin America and the Caribbean","Northern Africa", "Northern America","South-Eastern Asia", "Southern Asia","Sub-Saharan Africa","Western Africa", "Western Asia","Australia and New Zealand","World")) %>%
  group_by(country) %>%
  summarise(percentuale_media_perdite=mean(loss_percentage)) %>%
  arrange(desc(percentuale_media_perdite)) 
## # A tibble: 14 × 2
##    country                         percentuale_media_perdite
##    <fct>                                               <dbl>
##  1 Australia and New Zealand                           32.5 
##  2 Africa                                              30   
##  3 World                                               27.7 
##  4 Northern America                                     9.54
##  5 Sub-Saharan Africa                                   9.17
##  6 Southern Asia                                        8.43
##  7 Central Asia                                         8.16
##  8 Northern Africa                                      8.16
##  9 Western Asia                                         8.16
## 10 Latin America and the Caribbean                      8.13
## 11 Asia                                                 7.64
## 12 Europe                                               7.54
## 13 South-Eastern Asia                                   7.21
## 14 Western Africa                                       3.75

In questa tabella si possono leggere i dettagli del cibo sprecato in Italia, dallo spreco maggiore al minore, si nota un 29,2% di spreco per i vegetali, un 28,4% per carne e pesce ecc.:

df <-Data %>%
  filter(country =="Italy") %>%
  arrange(desc(loss_percentage)) %>%
  select(loss_percentage,country,commodity,year,food_supply_stage,activity,cause_of_loss,method_data_collection,reference,notes) 
  
kable(df)
loss_percentage country commodity year food_supply_stage activity cause_of_loss method_data_collection reference notes
29.2 Italy Other vegetables, fresh n.e.c. 2020 Whole supply chain Literature Review NA (2020), Digital platforms: mapping the territory of new technologies to fight food waste Sourced from Magrama 2014 b Reference has been generated automatically
28.4 Italy Meat, fish, fruits, vegetables, oils and fats 2020 Whole supply chain Literature Review NA (2020), Digital platforms: mapping the territory of new technologies to fight food waste Sourced from Magrama 2014 b Reference has been generated automatically
26.7 Italy Cereals 2020 Whole supply chain Literature Review NA (2020), Digital platforms: mapping the territory of new technologies to fight food waste Sourced from Magrama 2014 b Reference has been generated automatically
26.7 Italy Other legumes, for forage 2020 Whole supply chain Literature Review NA (2020), Digital platforms: mapping the territory of new technologies to fight food waste Sourced from Magrama 2014 b Reference has been generated automatically
23.1 Italy Other fruits, n.e.c. 2020 Whole supply chain Literature Review NA (2020), Digital platforms: mapping the territory of new technologies to fight food waste Sourced from Magrama 2014 b Reference has been generated automatically
22.7 Italy Wine 2020 Whole supply chain Literature Review NA (2020), Digital platforms: mapping the territory of new technologies to fight food waste Sourced from Magrama 2014 b Reference has been generated automatically
22.5 Italy Citrus fruits 2020 Whole supply chain Literature Review NA (2020), Digital platforms: mapping the territory of new technologies to fight food waste Sourced from Magrama 2014 b Reference has been generated automatically
10.5 Italy Other fruit-bearing vegetables n.e.c. 2014 Farm Farm Literature Review Xue Li et al, 2017

Come si vede la media dello spreco alimentare in Italia è il 23,73%, mentre la mediana il 24,9% :

summary(df$loss_percentage)
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   10.50   22.65   24.90   23.73   27.12   29.20

Fasi di approvvigionamento alimentare:

Come si vede dal seguente grafico le perdite maggiori di cibo in Europa riguardano il consumo delle famiglie e la raccolta del cibo:

Data %>%
  filter(country == "Europe",food_supply_stage!="")%>%
  group_by(food_supply_stage) %>%
  summarise(mean_loss=mean(loss_percentage)) %>%
  mutate(food_supply_stage = reorder(food_supply_stage,mean_loss)) %>%
  ggplot(aes(food_supply_stage,mean_loss))+
  geom_bar(stat = "identity",fill=30)+
  coord_flip()+
  ylim(0,14)+
  geom_text(aes(label=round(mean_loss,2)), hjust=0, size=3)+
  ggtitle("Percentuale di perdita del cibo", subtitle = "tramite Fasi di approvvigionamento alimentare in Europa")