AKM01<-cso_get_data("AKM01")
AKM02<-cso_get_data("AKM02")
AKM03<-cso_get_data("AKM03")
AKM01 <- AKM01%>%
pivot_longer(!1:2,names_to = "year_month")
AKM02 <- AKM02%>%
pivot_longer(!1:2,names_to = "year_month")
AKM03 <- AKM03%>%
pivot_longer(!1:2,names_to = "year_month")
AKM01$Month <- as.Date(paste(AKM01$year_month, "01", sep = "-"), "%YM%m-%d")
AKM01$Year <- year(AKM01$Month)
AKM02$Month <- as.Date(paste(AKM02$year_month, "01", sep = "-"), "%YM%m-%d")
AKM02$Year <- year(AKM02$Month)
AKM03$Month <- as.Date(paste(AKM03$year_month, "01", sep = "-"), "%YM%m-%d")
AKM03$Year <- year(AKM03$Month)
AKM01$value<-as.numeric(AKM01$value)
AKM02$value<-as.numeric(AKM02$value)
AKM03$value<-as.numeric(AKM03$value)
# AKM01
## Statistics included: 1.Intake (ltr), 2.Fat (%), 3.Protein (%)
AKM01.1 <- AKM01 %>%
filter(Statistic=="Intake of Cows Milk by Creameries and Pasteurisers")
AKM01.1.1 <- AKM01.1 %>%
filter(Domestic.or.Import.Source=="Domestic")
T_AKM01.1.1_1 <- AKM01.1.1 %>%
group_by(Year)%>%
summarise(Average_Intake = mean(value),
Total_Intake = sum(value))
ggplot(data=T_AKM01.1.1_1, aes(x=Year,y=Average_Intake,group=1))+
geom_line(colour="#00B700")+
theme_bw()+
geom_text_repel(aes(label=round(Average_Intake, digits=2)),data = T_AKM01.1.1_1, size = 2.5)+
ggtitle("Average - Intake of Cows Milk by Creameries and Pasteurisers")+
labs(subtitle = "AKM01-Domestic",y="Million Litres")+
theme(plot.title=element_text(face="bold"))
ggplot(data=T_AKM01.1.1_1, aes(x=Year,y=Total_Intake,group=1))+
geom_col(fill="#00B700",alpha=0.5)+
theme_bw()+
geom_text_repel(aes(label=round(Total_Intake, digits=2)),data = T_AKM01.1.1_1, size = 2.5)+
ggtitle("Total - Intake of Cows Milk by Creameries and Pasteurisers")+
labs(subtitle = "AKM01-Domestic",y="Million Litres")+
theme(plot.title=element_text(face="bold"))
# AKM01
## Statistics included: 1.Intake (ltr), 2.Fat (%), 3.Protein (%)
AKM01.1 <- AKM01 %>%
filter(Statistic=="Intake of Cows Milk by Creameries and Pasteurisers")
AKM01.1.2 <- AKM01.1 %>%
filter(Domestic.or.Import.Source=="Import")
T_AKM01.1.2_1 <- AKM01.1.2 %>%
group_by(Year)%>%
summarise(Average_Intake = mean(value),
Total_Intake = sum(value))
ggplot(data=T_AKM01.1.2_1, aes(x=Year,y=Average_Intake,group=1))+
geom_line(colour="#0B00B7")+
theme_bw()+
geom_text_repel(aes(label=round(Average_Intake, digits=2)),data = T_AKM01.1.2_1, size = 2.5)+
ggtitle("Average - Intake of Cows Milk by Creameries and Pasteurisers")+
labs(subtitle = "AKM01-Import",y="Million Litres")+
theme(plot.title=element_text(face="bold"))
ggplot(data=T_AKM01.1.2_1, aes(x=Year,y=Total_Intake,group=1))+
geom_col(fill="#0B00B7",alpha=0.5)+
theme_bw()+
geom_text_repel(aes(label=round(Total_Intake, digits=2)),data = T_AKM01.1.2_1, size = 2.5)+
ggtitle("Total - Intake of Cows Milk by Creameries and Pasteurisers")+
labs(subtitle = "AKM01-Import",y="Million Litres")+
theme(plot.title=element_text(face="bold"))
Whole, skimmed, semi etc
Cheese, Butter, Skimmed Powder