University of Cape Town
Cape Vegetation zones
R code
Plot Fynbos and Grassland Bioregions
#Plot grassland and fynbos biomes
#dev.new(width=11, height=8)
par(mar=c(1,2,.5,1), mai=c(1,1,0.75,0.25))
plot(newmap, axes=TRUE,lwd=3, cex.lab=1.25,xlab="Latitude", ylab="Longitude",xlim = c(16, 32), ylim = c(-35, -22), asp = 1, main="Fynbos and Grassland Biomes", cex.main=1.25, col="grey60")
plot(Fynbos, add=TRUE,col="#543005")
plot(Grassland, add=TRUE,col="#80cdc1")
box(bty="o", lwd=3)
label_cols <- c("#543005","#80cdc1")
labels<-c("Fynbos Biome", "Grassland Biome")
legend("bottomright", NULL, labels, fill=label_cols, density, bty="n", cex=0.9)

Plot Fynbos Bioregions
#dev.new(width=11, height=8)
par(mar=c(1,2,.5,1), mai=c(1,1,0.75,0.25))
plot(newmap, axes=TRUE,lwd=3, cex.lab=1.25,xlab="Latitude", ylab="Longitude",xlim = c(16, 27), ylim = c(-35, -30), asp = 1, main="Fynbos Bioregions", cex.main=1.25, col="grey60")
plot(ECReno, add=TRUE,col="#c7eae5")
plot(EFReno, add=TRUE,col="#543005")
plot(KarooReno, add=TRUE,col="#80cdc1")
plot(Namashrubs, add=TRUE, col="#01665e")
plot(nwFynbos, add=TRUE, col="#dfc27d")
plot(scFynbos, add=TRUE, col="#f6e8c3")
plot(sFynbos, add=TRUE, col="#bf812d")
plot(sStrand, add=TRUE, col="#003c30")
plot(swFynbos, add=TRUE, col="#8c510a")
plot(wcReno, add=TRUE, col="#3B2102")
plot(wStrand, add=TRUE, col="#35978f")
plot(wFynbosReno, add=TRUE, col="#f5f5f5")
box(bty="o", lwd=3)
label_cols_one <- c("#c7eae5","#543005", "#80cdc1","#01665e","#dfc27d","#f6e8c3")
labels_one<-c("East Coast Renosterveld Bioregion", "Eastern Fynbos-Renosterveld Bioregion", "Karoo Renosterveld Bioregion", "Namaqualand Cape Shrublands Bioregion",
"Northwest Fynbos Bioregion", "South Coast Fynbos Bioregion")
legend("bottomleft", NULL, labels_one, fill=label_cols_one, density, bty="n", cex=0.9)
label_cols_two <- c("#bf812d","#003c30","#8c510a","#3B2102","#35978f","#f5f5f5")
labels_two<-c("South Strandveld Bioregion","Southern Fynbos Bioregion", "Southwest Fynbos Bioregion",
"West Coast Renosterveld Bioregion", "West Strandveld Bioregion","Western Fynbos-Renosterveld Bioregion")
legend("bottom", NULL, labels_two, fill=label_cols_two, density, bty="n", cex=0.9)

Plot Grassland Bioregions
#dev.new(width=11, height=8)
par(mar=c(1,2,.5,1), mai=c(1,1,0.75,0.25))
plot(newmap, axes=TRUE,lwd=3, cex.lab=1.25,xlab="Latitude", ylab="Longitude",xlim = c(22, 34), ylim = c(-35, -24), asp = 1, main="Grassland Bioregions", cex.main=1.25, col="grey60")
plot(SubEscarp, add=TRUE,col="#c7eae5")
plot(Drakensberg, add=TRUE,col="#543005")
plot(DryHighveld, add=TRUE,col="#80cdc1")
plot(MesicHighveld, add=TRUE, col="#01665e")
box(bty="o", lwd=3)
label_cols_three <- c("#c7eae5","#543005", "#80cdc1","#01665e")
labels_three<-c("Sub-Escarpment Grassland Bioregion", "Drakensberg Grassland Bioregion", "Dry Highveld Grassland Bioregion",
"Mesic Highveld Grassland Bioregion")
legend("bottomright", NULL, labels_three, fill=label_cols_three, density, bty="n", cex=0.9)
