Is there any other way create the July mean temperature in Europe by using this dataset?

This is one of the way to create, CRU CL2.0 data is included in R. Is there any other way to create the map? It is better to have the outline and names of each country shown in the map.

library(getCRUCLdata)
CRU_data <- get_CRU_df(pre = TRUE,
pre_cv = TRUE,
rd0 = TRUE,
tmp = TRUE,
dtr = TRUE,
reh = TRUE,
tmn = TRUE,
tmx = TRUE,
sunp = TRUE,
frs = TRUE,
wnd = TRUE,
elv = TRUE)
CRU_data
t <- get_CRU_df(tmp = TRUE)
library(dplyr)
europe<-filter(t,t[1]<=75)
europe1<-filter(europe,europe[1]>=35)
europe2<-filter(europe1,europe1[2]<40)
europe3<-filter(europe2,europe2[2]>-10)
europejul<-filter(europe3,europe3[3]=="jul")
ggplot(data = europejul, aes(x = lon, y = lat, fill = tmp)) +
geom_tile() +
scale_fill_viridis(option = "inferno") +
coord_quickmap() +
ggtitle("Europe Mean Temperatures in July 1961-1990") +
facet_wrap( ~ month, nrow = 4)

This topic was automatically closed 21 days after the last reply. New replies are no longer allowed.

If you have a query related to it or one of the replies, start a new topic and refer back with a link.