x1 <- seq(as.Date("2016-01-01"),as.Date("2018-07-01"),by="month")
z1 <- c(0.45062130 ,0.51136174 ,0.6 ,0.8 ,0.29481738 ,0.6 ,0.27713756 ,0.62638512 ,0.23547530,0.29253901 ,0.75899501 ,0.67779756 ,0.51831742 ,0.08050147 ,0.71183739 ,0.13154414 ,0.79406706 ,0.13154414,0.03434758 ,0.59573892 ,0.22102821 ,0.13154414 ,0.13154414 ,0.13154414 ,0.13154414 ,0.13154414 ,0.23692593,0.95215104 ,0.38810846 ,0.17970580 ,0.05176054)
z2 <- z1^2
z3 <- z2^2
df <- data.frame(x1,z1,z2,z3)
head(df)
##           x1        z1         z2          z3
## 1 2016-01-01 0.4506213 0.20305956 0.041233183
## 2 2016-02-01 0.5113617 0.26149083 0.068377454
## 3 2016-03-01 0.6000000 0.36000000 0.129600000
## 4 2016-04-01 0.8000000 0.64000000 0.409600000
## 5 2016-05-01 0.2948174 0.08691729 0.007554615
## 6 2016-06-01 0.6000000 0.36000000 0.129600000
library(colorRamps)
time <- c(x1)
depths <- c(1,2,3)
temp2 <- as.matrix(data.frame(df$z1,df$z2,df$z3))
temp2<- matrix(temp2,ncol=ncol(temp2), dimnames = NULL)
filled.contour(time,depths,temp2, col=(matlab.like2(16)), 
               ylab="Depth", xlab="Time",
               key.title=title(expression('  Temp ('*degree*'C)')),xaxs="i")

temp2 <- as.matrix(data.frame(df$z1,df$z2,df$z3))
temp2<- matrix(temp2,ncol=ncol(temp2), dimnames = NULL)
filled.contour(time,depths,temp2, col=(matlab.like2(18)), 
               ylab="Depth", xlab="Time",
               key.title=title(expression('  Temp ('*degree*'C)')),xaxs="i")

temp2 <- as.matrix(data.frame(df$z1,df$z2,df$z3))
temp2<- matrix(temp2,ncol=ncol(temp2), dimnames = NULL)
filled.contour(time,depths,temp2, col=(matlab.like2(20)), 
               ylab="Depth", xlab="Time",
               key.title=title(expression('  Temp ('*degree*'C)')),xaxs="i")

temp2 <- as.matrix(data.frame(df$z1,df$z2,df$z3))
temp2<- matrix(temp2,ncol=ncol(temp2), dimnames = NULL)
filled.contour(time,depths,temp2, col=(matlab.like2(22)), 
               ylab="Depth", xlab="Time",
               key.title=title(expression('  Temp ('*degree*'C)')),xaxs="i")

temp2 <- as.matrix(data.frame(df$z1,df$z2,df$z3))
temp2<- matrix(temp2,ncol=ncol(temp2), dimnames = NULL)
filled.contour(time,depths,temp2, col=(matlab.like2(24)), 
               ylab="Depth", xlab="Time",
               key.title=title(expression('  Temp ('*degree*'C)')),xaxs="i")

temp2 <- as.matrix(data.frame(df$z1,df$z2,df$z3))
temp2<- matrix(temp2,ncol=ncol(temp2), dimnames = NULL)
filled.contour(time,depths,temp2, col=(matlab.like(20)), 
               ylab="Depth", xlab="Time",
               key.title=title(expression('  Temp ('*degree*'C)')),xaxs="i")

temp2 <- as.matrix(data.frame(df$z1,df$z2,df$z3))
temp2<- matrix(temp2,ncol=ncol(temp2), dimnames = NULL)
filled.contour(time,depths,temp2, col=(matlab.like(24)), 
               ylab="Depth", xlab="Time",
               key.title=title(expression('  Temp ('*degree*'C)')),xaxs="i")