1 |
9a19743f
|
Adam M. Wilson
|
### Script to compile the monthly cloud data from earth engine into a netcdf file for further processing
|
2 |
|
|
|
3 |
|
|
library(raster)
|
4 |
|
|
library(doMC)
|
5 |
41d291a6
|
Adam M. Wilson
|
library(multicore)
|
6 |
|
|
library(foreach)
|
7 |
|
|
#library(doMPI)
|
8 |
ba7057c4
|
Adam M. Wilson
|
registerDoMC(4)
|
9 |
41d291a6
|
Adam M. Wilson
|
#beginCluster(4)
|
10 |
9a19743f
|
Adam M. Wilson
|
|
11 |
ba7057c4
|
Adam M. Wilson
|
wd="~/acrobates/adamw/projects/cloud"
|
12 |
|
|
setwd(wd)
|
13 |
f5ef0596
|
Adam M. Wilson
|
|
14 |
e7503f8e
|
Adam M. Wilson
|
tempdir="tmp"
|
15 |
|
|
if(!file.exists(tempdir)) dir.create(tempdir)
|
16 |
f5ef0596
|
Adam M. Wilson
|
|
17 |
9a19743f
|
Adam M. Wilson
|
## Get list of available files
|
18 |
41d291a6
|
Adam M. Wilson
|
df=data.frame(path=list.files("/mnt/data2/projects/cloud/mod09",pattern="*.tif$",full=T,recur=T),stringsAsFactors=F)
|
19 |
f5ef0596
|
Adam M. Wilson
|
df[,c("region","year","month")]=do.call(rbind,strsplit(basename(df$path),"_|[.]"))[,c(1,2,3)]
|
20 |
9a19743f
|
Adam M. Wilson
|
df$date=as.Date(paste(df$year,"_",df$month,"_15",sep=""),"%Y_%m_%d")
|
21 |
|
|
|
22 |
41d291a6
|
Adam M. Wilson
|
## add stats to test for missing data
|
23 |
|
|
addstats=F
|
24 |
|
|
if(addstats){
|
25 |
|
|
df[,c("max","min","mean","sd")]=do.call(rbind.data.frame,mclapply(1:nrow(df),function(i) as.numeric(sub("^.*[=]","",grep("STATISTICS",system(paste("gdalinfo -stats",df$path[i]),inter=T),value=T)))))
|
26 |
|
|
table(df$sd==0)
|
27 |
|
|
}
|
28 |
|
|
|
29 |
f5ef0596
|
Adam M. Wilson
|
## subset to testtiles?
|
30 |
c8be7255
|
Adam M. Wilson
|
#df=df[df$region%in%testtiles,]
|
31 |
41d291a6
|
Adam M. Wilson
|
#df=df[df$month==1,]
|
32 |
f5ef0596
|
Adam M. Wilson
|
table(df$year,df$month)
|
33 |
d7dc526e
|
Adam M. Wilson
|
|
34 |
e7503f8e
|
Adam M. Wilson
|
writeLines(paste("Tiling options will produce",nrow(tiles),"tiles and ",nrow(jobs),"tile-months. Current todo list is ",length(todo)))
|
35 |
|
|
|
36 |
|
|
|
37 |
9a19743f
|
Adam M. Wilson
|
## drop some if not complete
|
38 |
ba7057c4
|
Adam M. Wilson
|
#df=df[df$month%in%1:9&df$year%in%c(2001:2012),]
|
39 |
e7503f8e
|
Adam M. Wilson
|
rerun=T # set to true to recalculate all dates even if file already exists
|
40 |
9a19743f
|
Adam M. Wilson
|
|
41 |
|
|
## Loop over existing months to build composite netcdf files
|
42 |
|
|
foreach(date=unique(df$date)) %dopar% {
|
43 |
ba7057c4
|
Adam M. Wilson
|
## get date
|
44 |
9a19743f
|
Adam M. Wilson
|
print(date)
|
45 |
|
|
## Define output and check if it already exists
|
46 |
ba7057c4
|
Adam M. Wilson
|
vrtfile=paste(tempdir,"/mod09_",date,".vrt",sep="")
|
47 |
9a19743f
|
Adam M. Wilson
|
ncfile=paste(tempdir,"/mod09_",date,".nc",sep="")
|
48 |
ba7057c4
|
Adam M. Wilson
|
tffile=paste(tempdir,"/mod09_",date,".tif",sep="")
|
49 |
|
|
|
50 |
|
|
if(!rerun&file.exists(ncfile)) return(NA)
|
51 |
9a19743f
|
Adam M. Wilson
|
## merge regions to a new netcdf file
|
52 |
ba7057c4
|
Adam M. Wilson
|
# system(paste("gdal_merge.py -o ",tffile," -init -32768 -n -32768.000 -ot Int16 ",paste(df$path[df$date==date],collapse=" ")))
|
53 |
e7503f8e
|
Adam M. Wilson
|
system(paste("gdalbuildvrt -overwrite -srcnodata -32768 -vrtnodata -32768 ",vrtfile," ",paste(df$path[df$date==date],collapse=" ")))
|
54 |
ba7057c4
|
Adam M. Wilson
|
## Warp to WGS84 grid and convert to netcdf
|
55 |
e7503f8e
|
Adam M. Wilson
|
##ops="-t_srs 'EPSG:4326' -multi -r cubic -te -180 0 180 10 -tr 0.008333333333333 -0.008333333333333 -wo SOURCE_EXTRA=50" #-wo SAMPLE_GRID=YES -wo SAMPLE_STEPS=100
|
56 |
|
|
ops="-t_srs 'EPSG:4326' -multi -r cubic -te -180 -90 180 90 -tr 0.008333333333333 -0.008333333333333 -wo SOURCE_EXTRA=50"
|
57 |
ba7057c4
|
Adam M. Wilson
|
|
58 |
e7503f8e
|
Adam M. Wilson
|
system(paste("gdalwarp -overwrite ",ops," -et 0 -srcnodata -32768 -dstnodata -32768 ",vrtfile," ",tffile," -ot Int16"))
|
59 |
|
|
system(paste("gdal_translate -of netCDF ",tffile," ",ncfile))
|
60 |
|
|
# system(paste("gdalwarp -overwrite ",ops," -srcnodata -32768 -dstnodata -32768 -of netCDF ",vrtfile," ",tffile," -ot Int16"))
|
61 |
|
|
file.remove(tffile)
|
62 |
ba7057c4
|
Adam M. Wilson
|
setwd(wd)
|
63 |
9a19743f
|
Adam M. Wilson
|
system(paste("ncecat -O -u time ",ncfile," ",ncfile,sep=""))
|
64 |
|
|
## create temporary nc file with time information to append to MOD06 data
|
65 |
|
|
cat(paste("
|
66 |
|
|
netcdf time {
|
67 |
|
|
dimensions:
|
68 |
|
|
time = 1 ;
|
69 |
|
|
variables:
|
70 |
|
|
int time(time) ;
|
71 |
|
|
time:units = \"days since 2000-01-01 00:00:00\" ;
|
72 |
|
|
time:calendar = \"gregorian\";
|
73 |
|
|
time:long_name = \"time of observation\";
|
74 |
|
|
data:
|
75 |
|
|
time=",as.integer(date-as.Date("2000-01-01")),";
|
76 |
|
|
}"),file=paste(tempdir,"/",date,"_time.cdl",sep=""))
|
77 |
|
|
system(paste("ncgen -o ",tempdir,"/",date,"_time.nc ",tempdir,"/",date,"_time.cdl",sep=""))
|
78 |
|
|
system(paste("ncks -A ",tempdir,"/",date,"_time.nc ",ncfile,sep=""))
|
79 |
|
|
## add other attributes
|
80 |
|
|
system(paste("ncrename -v Band1,CF ",ncfile,sep=""))
|
81 |
|
|
system(paste("ncatted ",
|
82 |
ba7057c4
|
Adam M. Wilson
|
" -a units,CF,o,c,\"%\" ",
|
83 |
f5ef0596
|
Adam M. Wilson
|
# " -a valid_range,CF,o,b,\"0,100\" ",
|
84 |
|
|
" -a scale_factor,CF,o,f,\"0.1\" ",
|
85 |
ba7057c4
|
Adam M. Wilson
|
" -a _FillValue,CF,o,f,\"-32768\" ",
|
86 |
|
|
" -a long_name,CF,o,c,\"Cloud Frequency(%)\" ",
|
87 |
|
|
" -a NETCDF_VARNAME,CF,o,c,\"Cloud Frequency(%)\" ",
|
88 |
|
|
" -a title,global,o,c,\"Cloud Climatology from MOD09 Cloud Mask\" ",
|
89 |
|
|
" -a institution,global,o,c,\"Jetz Lab, EEB, Yale University, New Haven, CT\" ",
|
90 |
|
|
" -a source,global,o,c,\"Derived from MOD09GA Daily Data\" ",
|
91 |
|
|
" -a comment,global,o,c,\"Developed by Adam M. Wilson (adam.wilson@yale.edu / http://adamwilson.us)\" ",
|
92 |
f5ef0596
|
Adam M. Wilson
|
ncfile,sep=""))
|
93 |
|
|
|
94 |
|
|
## add the fillvalue attribute back (without changing the actual values)
|
95 |
|
|
#system(paste("ncatted -a _FillValue,CF,o,b,-32768 ",ncfile,sep=""))
|
96 |
9a19743f
|
Adam M. Wilson
|
|
97 |
|
|
if(as.numeric(system(paste("cdo -s ntime ",ncfile),intern=T))<1) {
|
98 |
|
|
print(paste(ncfile," has no time, deleting"))
|
99 |
d7dc526e
|
Adam M. Wilson
|
file.remove(ncfile)
|
100 |
9a19743f
|
Adam M. Wilson
|
}
|
101 |
|
|
print(paste(basename(ncfile)," Finished"))
|
102 |
|
|
|
103 |
d7dc526e
|
Adam M. Wilson
|
|
104 |
ba7057c4
|
Adam M. Wilson
|
}
|
105 |
d7dc526e
|
Adam M. Wilson
|
|
106 |
|
|
|
107 |
9a19743f
|
Adam M. Wilson
|
### merge all the tiles to a single global composite
|
108 |
|
|
#system(paste("ncdump -h ",list.files(tempdir,pattern="mod09.*.nc$",full=T)[10]))
|
109 |
ba7057c4
|
Adam M. Wilson
|
system(paste("cdo -O mergetime ",paste(list.files(tempdir,pattern="mod09.*.nc$",full=T),collapse=" ")," data/cloud_daily.nc"))
|
110 |
9a19743f
|
Adam M. Wilson
|
|
111 |
ba7057c4
|
Adam M. Wilson
|
# Overall mean
|
112 |
|
|
system(paste("cdo -O -chname,CF,CF_annual -timmean data/cloud_daily.nc data/cloud_mean.nc"))
|
113 |
9a19743f
|
Adam M. Wilson
|
|
114 |
|
|
### generate the monthly mean and sd
|
115 |
d86b0a4a
|
Adam M. Wilson
|
#system(paste("cdo -P 10 -O merge -ymonmean data/mod09.nc -chname,CF,CF_sd -ymonstd data/mod09.nc data/mod09_clim.nc"))
|
116 |
ba7057c4
|
Adam M. Wilson
|
system(paste("cdo -O -ymonmean data/cloud_daily.nc data/cloud_ymonmean.nc"))
|
117 |
|
|
system(paste("cdo -O -chname,CF,CF_sd -ymonstd data/cloud_daily.nc data/cloud_ymonsd.nc"))
|
118 |
|
|
|
119 |
|
|
#if(!file.exists("data/mod09_metrics.nc")) {
|
120 |
|
|
# system("cdo -chname,CF,CFmin -timmin data/mod09_clim_mean.nc data/mod09_min.nc")
|
121 |
|
|
# system("cdo -chname,CF,CFmax -timmax data/mod09_clim_mean.nc data/mod09_max.nc")
|
122 |
|
|
# system("cdo -chname,CF,CFsd -timstd data/mod09_clim_mean.nc data/mod09_std.nc")
|
123 |
|
|
# system("cdo -f nc2 merge data/mod09_std.nc data/mod09_min.nc data/mod09_max.nc data/mod09_metrics.nc")
|
124 |
|
|
system("cdo merge -chname,CF,CFmin -timmin data/cloud_clim_mean.nc -chname,CF,CFmax -timmax data/cloud_clim_mean.nc -chname,CF,CFsd -timstd data/cloud_clim_mean.nc data/cloud_metrics.nc")
|
125 |
|
|
#}
|
126 |
|
|
|
127 |
|
|
|
128 |
|
|
|
129 |
|
|
|
130 |
|
|
|
131 |
d7dc526e
|
Adam M. Wilson
|
|
132 |
|
|
|
133 |
|
|
### Long term summaries
|
134 |
|
|
seasconc <- function(x,return.Pc=T,return.thetat=F) {
|
135 |
|
|
#################################################################################################
|
136 |
|
|
## Precipitation Concentration function
|
137 |
|
|
## This function calculates Precipitation Concentration based on Markham's (1970) technique as described in Schulze (1997)
|
138 |
|
|
## South Africa Atlas of Agrohydology and Climatology - R E Schulze, M Maharaj, S D Lynch, B J Howe, and B Melvile-Thomson
|
139 |
|
|
## Pages 37-38
|
140 |
|
|
#################################################################################################
|
141 |
|
|
## x is a vector of precipitation quantities - the mean for each factor in "months" will be taken,
|
142 |
|
|
## so it does not matter if the data are daily or monthly, as long as the "months" factor correctly
|
143 |
|
|
## identifies them into 12 monthly bins, collapse indicates whether the data are already summarized as monthly means.
|
144 |
|
|
#################################################################################################
|
145 |
|
|
theta=seq(30,360,30)*(pi/180) # set up angles for each month & convert to radians
|
146 |
|
|
if(sum(is.na(x))==12) { return(cbind(Pc=NA,thetat=NA)) ; stop}
|
147 |
|
|
if(return.Pc) {
|
148 |
|
|
rt=sqrt(sum(x * cos(theta))^2 + sum(x * sin(theta))^2) # the magnitude of the summation
|
149 |
|
|
Pc=as.integer(round((rt/sum(x))*100))}
|
150 |
|
|
if(return.thetat){
|
151 |
|
|
s1=sum(x*sin(theta),na.rm=T); s2=sum(x*cos(theta),na.rm=T)
|
152 |
|
|
if(s1>=0 & s2>=0) {thetat=abs((180/pi)*(atan(sum(x*sin(theta),na.rm=T)/sum(x*cos(theta),na.rm=T))))}
|
153 |
|
|
if(s1>0 & s2<0) {thetat=180-abs((180/pi)*(atan(sum(x*sin(theta),na.rm=T)/sum(x*cos(theta),na.rm=T))))}
|
154 |
|
|
if(s1<0 & s2<0) {thetat=180+abs((180/pi)*(atan(sum(x*sin(theta),na.rm=T)/sum(x*cos(theta),na.rm=T))))}
|
155 |
|
|
if(s1<0 & s2>0) {thetat=360-abs((180/pi)*(atan(sum(x*sin(theta),na.rm=T)/sum(x*cos(theta),na.rm=T))))}
|
156 |
|
|
thetat=as.integer(round(thetat))
|
157 |
|
|
}
|
158 |
|
|
if(return.thetat&return.Pc) return(c(conc=Pc,theta=thetat))
|
159 |
|
|
if(return.Pc) return(Pc)
|
160 |
|
|
if(return.thetat) return(thetat)
|
161 |
|
|
}
|
162 |
|
|
|
163 |
|
|
|
164 |
ba7057c4
|
Adam M. Wilson
|
|
165 |
d7dc526e
|
Adam M. Wilson
|
## read in monthly dataset
|
166 |
d86b0a4a
|
Adam M. Wilson
|
mod09=brick("data/mod09_clim_mean.nc",varname="CF")
|
167 |
d7dc526e
|
Adam M. Wilson
|
plot(mod09[1])
|
168 |
9a19743f
|
Adam M. Wilson
|
|
169 |
d7dc526e
|
Adam M. Wilson
|
mod09_seas=calc(mod09,seasconc,return.Pc=T,return.thetat=F,overwrite=T,filename="data/mod09_seas.nc",NAflag=255,datatype="INT1U")
|
170 |
d86b0a4a
|
Adam M. Wilson
|
mod09_seas2=calc(mod09,seasconc,return.Pc=F,return.thetat=T,overwrite=T,filename="data/mod09_seas_theta.nc",datatype="INT1U")
|
171 |
9a19743f
|
Adam M. Wilson
|
|
172 |
d7dc526e
|
Adam M. Wilson
|
plot(mod09_seas)
|