library(corrplot)

#数据准备
M=structure(c(0.271, 0.354, 0.325, 0.653, 0.614, 0.615, 0.498, 
NA, 0.2, 0.241, 0.41, 0.387, 0.395, 0.352, NA, NA, 0.121, 0.43, 
0.418, 0.427, 0.31, NA, NA, NA, 0.202, 0.242, 0.275, 0.211, NA, 
NA, NA, NA, 0.191, 0.195, 0.234, NA, NA, NA, NA, NA, 0.191, 0.275, 
NA, NA, NA, NA, NA, NA, 0.111), dim = c(7L, 7L), dimnames = list(
    c("MeanT", "MeanRH", "Precipitation", "Pop_Den", "Night-ime light", 
    "Landuse", "Travel"), c("MeanT", "MeanRH", "Precipitation", 
    "Pop_Den", "Night.ime.light", "Landuse", "Travel")))



#绘制
corrplot(M, method = 'pie', type = 'lower', tl.col = 'black', tl.srt = 0, cl.cex=0.8, tl.cex = 0.8, addgrid.col = NA, addCoef.col = 'black', number.cex=0.8, number.digits=3, col = COL1('Oranges'), col.lim=c(0,1), is.corr=FALSE)