The following series have obsolete data discussed here: #1, #2, #6, #21, #23, #27, #28, #30, #35, 37, #43, #51, #52, #54, #55, #56, #58, #65.
#LOAD DATA load("c:/climate/data/mann/proxy3.tab") new<-proxy #this has tree ring PCs load("c:/climate/data/mann/proxy.tab") load("c:/climate/data/mann/prname.tab") base<-"C:/Documents and Settings/Stephen McIntyre/My Documents/climate/website"
output<-function(combine,k) { loc.out<-file.path(base,"images",paste(paste("series",k,sep=""),"png",sep=".")) png(file=loc.out,width=800,height=600,pointsize=120,bg="white"); plot.ts(combine,main=paste(prname[k,3])) dev.off(); year<-ts(c (tsp(combine)[1] : tsp(combine)[2] ) ,start=tsp(combine)[1] ,end= tsp(combine)[2]) b<-dimnames(combine)[[2]] combine<-ts.union(year,combine) dimnames(combine)[[2]]<-c("Year",b) loc.out.2<-file.path(base,"data",paste(paste("series",k,sep=""),"txt",sep=".")) write.table(combine,file=loc.out.2,quote=FALSE,sep="\t",row.names=FALSE) }
#CORAL #1. Burdekin River Fluorescence #the use of NGDC data is supported by email from Janice Lough, the originating author url<-"ftp://ftp.ngdc.noaa.gov/paleo/coral/west_pacific/great_barrier/pandora_fluorescence.txt" g<-read.table(url,skip=1) NGDC1<-ts(g[,2],start=1746,end=1980) #g1 goes from -1.93 to 3.16 url<-"ftp://ftp.ngdc.noaa.gov/paleo/coral/west_pacific/great_barrier/burdekin_2001.txt" h<-readLines(url,n=-1) #select the following by inspection: Pandora Reef standardized (with respect to long-term mean & sd) fluorescence index, 1737-1980 g<-h[735:978] write.table(g,file="c:/temp/g.txt",quote=FALSE) g<-read.table("c:/temp/g.txt",fill=TRUE,skip=2) #1737 to 1980 NGDC2<-ts(g[,3],start=1737,end=1980) f<-ts.union(proxy[,1],NGDC1,NGDC2) cor(f,use="pairwise.complete.obs") #-0.04192954 is correlation with NGDC1 #0.4218013 is correlation with NGDC2
k<-1 MBH<-proxy[,k] NGDC<-NGDC2 diff<-scale(f)[,1]-scale(f)[,3] f<-ts.union(MBH,NGDC,diff) output(f,k)
2. Great Barrier Reef Coral Band Thickness #MBH2 has reference Lough, pers comm. MBH location is 19S 148E, start 1615 to 1982, MBH2 values in -1,1 type of range#Lough published Great Barrier Reef coral data in Lough and Barnes J Exp Mar Biology and Ecology (1997) prior to MBH98 #Lough (pers. comm. Oct. 2003) stated that the data is coral calcification and average of reefs provided informally to Ed Cook #there are 5 NGDC series before 1650. These are loaded and averaged, following Lough's email. url<-NULL url<-c(url,"ftp://ftp.ngdc.noaa.gov/paleo/coral/west_pacific/great_barrier/abraham.txt")#Abraham Reef (AUS; 22S,153E) 1479-198 url<-c(url,"ftp://ftp.ngdc.noaa.gov/paleo/coral/west_pacific/great_barrier/britomart.txt")#Britomart Reef (AUS; 18S,146E) 1574 url<-c(url,"ftp://ftp.ngdc.noaa.gov/paleo/coral/west_pacific/great_barrier/havannah.txt")#Havannah Island (AUS; 18S,146E) 1583 url<-c(url,"ftp://ftp.ngdc.noaa.gov/paleo/coral/west_pacific/great_barrier/lodestone.txt")#Lodestone Reef (AUS; 18S,147E) 1615 url<-c(url,"ftp://ftp.ngdc.noaa.gov/paleo/coral/west_pacific/great_barrier/sanctuary.txt")#Sanctuary Reef (AUS; 22S,152E) 1501 #calcification (pace Lough) is in column 4 f<-NULL for (k in 1:5) { g<-read.table(url[k],skip=1) start1<-g[1,1] g<-ts(g[,4],start=start1,end=start1+nrow(g)-1) f<-ts.union(f,g) } h<-apply(f,1,mean,na.rm=FALSE)#only years with all values used h<-ts(h,start=tsp(f)[1],end=tsp(f)[2]) f<-ts.union(proxy[,2],h) cor(f,use="pairwise.complete.obs")[1,2] #0.9989313
k<-2 MBH<-proxy[,k] NGDC<-h diff<-scale(combine)[,1]-scale(combine)[,2] f<-ts.union(MBH,NGDC,diff) output(f,k)
url<-"ftp://ftp.ngdc.noaa.gov/paleo/coral/east_pacific/urvcomp.txt" #h<-readLines(url,n=-1) g0<-read.table(url,skip=1,fill=TRUE,blank.lines.skip=TRUE)#1607-1980 g0<-g0[nrow(g0):1,] g<-g0[,2] g<-c(g[1:(1906-1606)],NA,NA,NA,g[(1907-1606):length(g)]) g<-c(g[1:(1953-1606)],g[(1955-1606):length(g)]) g<-ts(g,start=1607,end=1981) combine<-ts.union(proxy[,3],g) combine #this shows transformation and 1962-1964 overlay plot.ts(combine) #MBH is transformed, but sign is not reversed edit<-g temp<-!is.na(edit[(1960-1606):(1981-1606)]) edit[(1960-1606):(1981-1606)][temp]<-edit[(1960-1606):(1981-1606)][temp]+0.4 #using splice declaration combine<-ts.union(proxy[,3],edit) plot.ts(combine) #MBH is transformed, and sign is reversed cor(combine,use="pairwise.complete.obs")[1,2] # -0.9992951 MBH<-proxy[,3] minusNGDC<-edit diff<-scale(combine)[,1]+scale(combine)[,2] f<-ts.union(MBH,minusNGDC,diff) output(f,3)
url<-"ftp://ftp.ngdc.noaa.gov/paleo/coral/red_sea/aq18-18o.txt" #This matches exactly. #Not normalized in MBH#there are two 1953 records at NGDC: 18040 and 18041. MBH use the sample 18040, rather than the average. h<-readLines(url,n=-1) h<-h[12:length(h)] h<-substr(h,29,33) h<-as.numeric(h) h<-h[length(h):1] h<-c( h[1:(1952-1787)],mean(h[(1953-1787):(1954-1787)]),h[(1955-1787):length(h)]) h<-ts(h,start=1788,end=1992) MBH<-proxy[,4] NGDC<-h combine<-ts.union(MBH,NGDC) combine output(combine,4) plot.ts(-combine[,1],main=paste("minus ",prname[4,3])) #There are two records at NGDC - core 18 (1788-1992) and core 19. Only Core 18 is used.
#matches exactly url<-"ftp://ftp.ngdc.noaa.gov/paleo/coral/red_sea/aq18-13c.txt" h<-readLines(url,n=-1) h<-h[12:length(h)] h<-substr(h,29,34) h<-as.numeric(h) h<-h[length(h):1] h<-c( h[1:(1952-1787)],mean(h[(1953-1787):(1954-1787)]),h[(1955-1787):length(h)]) h<-ts(h,start=1788,end=1992) combine<-ts.union(proxy[,5],h) combine MBH<-proxy[,5] NGDC<-h combine<-ts.union(MBH,NGDC) output(combine,5)
#look at Core 19 url<-"ftp://ftp.ngdc.noaa.gov/paleo/coral/red_sea/aq19-13c.txt" h<-readLines(url,n=-1) h<-h[13:length(h)] h<-c(h[1:39],h[41:length(h)]) #removes duplicate 1953 g<-substr(h,24,30) g<-g[length(g):1] g<-ts(g,start=1886,end=1992) combine<-ts.union(combine,g) combine cor(combine,use="pairwise.complete.obs") plot.ts(combine,main=paste("minus ",prname[5,3])) ts.plot(ts(scale(proxy[,5]),start=1400,end=1994),main=paste("minus ",prname[5,3]))
#one plug in 1980 url<-"ftp://ftp.ngdc.noaa.gov/paleo/coral/west_pacific/vanuatu_annual.txt" h<-read.table(url,fill=TRUE,skip=1) h<-h[174:1,] h<-ts(h,start=1806,end=1979) NGDC<-h[,5] MBH<-proxy[,6] combine<-ts.union(MBH,NGDC) #combine cor(combine,use="pairwise.complete.obs")[1,2]#0.9315452
7. New Caledonia δO18 Quinn et al 1996 #out of synch in 18th century . MBH has down-spike in 1750url<-"ftp://ftp.ngdc.noaa.gov/paleo/coral/west_pacific/nc_published_1992-1657_qtr.txt" h<-read.table(url,fill=TRUE,skip=1) #dim(h) #1341 3 #dO18 in col3 #for 1657-1992 h<-h[nrow(h):1,] h<-ts(h,start=1657.75,end=1992.75,frequency=4) ht<-c(h[,3]) ht<-c(NA,NA,NA,ht) ht<-array(ht, dim=c(4,length(ht)/4)) ht<-t(ht) ht<-apply(ht,1,mean) ht<-ts(ht,start=1657,end=1993) ht MBH<-proxy[,7] NGDC<-ht combine<-ts.union(MBH,NGDC) cor(combine,use="pairwise.complete.obs")[1,2]#0.6184227 k<-7 diff<-MBH-NGDC f<-ts.union(MBH,NGDC,diff) output(f,k)
#virtually exact match, could be due to how annual average made. No problem with data here. #MBH has original O18 without being transformed. #there is some apparently missing data at NGDC which is interpolated here. An inquity to NGDC was made. url<-"ftp://ftp.ngdc.noaa.gov/paleo/coral/east_pacific/secas-10yr-iso.txt" h<-readLines(url,n=-1) write.table(h[1:(length(h)-1)],file="c:/temp/h.txt",quote=FALSE) g<-read.table("c:/temp/h.txt",skip=5,fill=TRUE) g<-cbind(g,floor(g[,3]) gf<-factor(g[,6]) f<-tapply(g[,5],gf,mean) NGDC<-ts(f,start=1707,end=1984) MBH<-proxy[,8] combine<-ts.union(proxy[,8],f) cor(combine,use="pairwise.complete.obs")[1,2] # 0.9829115
k<-8 diff<-MBH-NGDC f<-ts.union(MBH,NGDC,diff) output(f,k)
#virtually exact match, could be due to how annual average made. No problem with data here. #MBH has original O18 without being transformed. #there is some apparently missing data at NGDC which is interpolated here. An inquity to NGDC was made. url<-"ftp://ftp.ngdc.noaa.gov/paleo/coral/east_pacific/secas-10yr-iso.txt" h<-readLines(url,n=-1) write.table(h[1:(length(h)-1)],file="c:/temp/h.txt",quote=FALSE) g<-read.table("c:/temp/h.txt",skip=5,fill=TRUE) g<-cbind(g,floor(g[,3]) gf<-factor(g[,6]) f<-tapply(g[,4],gf,mean) NGDC<-ts(f,start=1707,end=1984) MBH<-proxy[,9] combine<-ts.union(MBH,NGDC) cor(combine,use="pairwise.complete.obs")[1,2]
# 0.9915315 k<-9 diff<-MBH-NGDC f<-ts.union(MBH,NGDC,diff) output(f,k)
#identification with summer data url<-"http://www.metoffice.com/research/hadleycentre/CR_data/Daily/HadCET_act.txt" g<-read.table(url,fill=TRUE,skip=7) #1659 to 2003 ANN<-ts(g[,14],start=1659,end=2003) #column 14 has annual data temp<-(ANN< (-90)) #this identifies NA data marker ANN[temp]<-NA JJA<-ts( apply(g[,7:9],1,mean,na.rm=TRUE) ,start=1659,end=2003) f<-ts.union(proxy[,10],ANN,JJA) cor(f,use="pairwise.complete.obs") #proxy[, 10] ANN JJA #proxy[, 10] 1.0000000 0.6201681 0.9985103 # ANN 0.6201681 1.0000000 0.6174746 # JJA 0.9985103 0.6174746 1.0000000 f[400:450,] #shows series together in an interval
#truncation of data from 1659 to 1730 f[259:350,] #shows missing data in MBH98
#truncated values include 17th century cold spell plot.ts(f,main=paste(prname[10,3])) #shows cold spell
#high 1987 value in MBH98 f[577:589,] #shows higher MBH98 values
#identification with summer data url<-"ftp://ftp.ngdc.noaa.gov/paleo/climate1500ad/ch6.txt" g<-read.fwf(url,widths=c(rep(4,25)),skip=2) #1525 to 1979 g<-g[1:nrow(g)-1,] #eliminates all NA row ANN<-apply(g[,2:13],1,mean,na.rm=TRUE) #calculates annual average JJA<- apply(g[,7:9],1,mean,na.rm=TRUE) #calculates JJA average ANN<-ts(ANN,start=1525,end=1979) JJA<-ts(JJA,start=1525,end=1979) f<-ts.union(proxy[,11],ANN,JJA) cor(f,use="pairwise.complete.obs") #proxy[, 11] ANN JJA #proxy[, 11] 1.0000000 0.5952711 0.9999965 #ANN 0.5952711 1.0000000 0.6148496 #JJA 0.9999965 0.6148496 1.0000000 f[400:450,] #shows series together in an interval
#truncation of data from 1525 to 1550 f[121:170,] #output from 1520 to 1570 shows missing data in MBH98
#truncated data are high values plot.ts(f,main=paste(prname[11,3])) #shows that truncated values are high values
12. Quelccaya 1 ice core O18 #1983-84 values are from a pit k<-12 url<-"ftp://ftp.ngdc.noaa.gov/paleo/icecore/trop/quelccaya/q83cor1.txt" h<-readLines(url,n=-1) skip1<-25 write.table(h[(skip1+1):(length(h)-7)],file="c:/temp/ice.txt",quote=FALSE,row.names=FALSE) widths1<-c(5,9,9,8,5,7,6,7) y<-read.fwf(file="c:/temp/ice.txt",fill=TRUE,skip=1,widths=widths1,blank.lines.skip=TRUE) #O18 in col 6 #marker[k]<- -999 #temp<-(y==marker[k]) b<-c("YEAR","0.63.to.0.80","plus0.63","plus1.59","COND","O18","ACCUM.m","ACCUM.sd") dimnames(y)[[2]]<-b n<-nrow(y) y<-y[n:1,] y<-ts(y,start=470,end=1984) combine<-ts.union(proxy[,12],y[,6]) combine[(1400-469):(1984-469),] #these are identical NGDC<-y[,6] loc.out<-file.path(base,"images",paste(paste("series",k,sep=""),"png",sep=".")) png(file=loc.out,width=800,height=600,pointsize=120,bg="white"); plot.ts(NGDC,main=paste(prname[k,3])) dev.off();
13. Quelccaya 1 ice core Accumulation MBH<-proxy[,13] NGDC<-y[,7] diff<-MBH-NGDC combine<-ts.union(MBH,NGDC,diff) output(combine,13)
14. Quelccaya 1 ice core O18 url<-"ftp://ftp.ngdc.noaa.gov/paleo/icecore/trop/quelccaya/q83summ.txt" h<-readLines(url,n=-1) skip1<-26 write.table(h[(skip1+1):(length(h)-8)],file="c:/temp/ice.txt",quote=FALSE,row.names=FALSE) widths1<-c(4,11,10,10,6,6,6,6) y<-read.fwf(file="c:/temp/ice.txt",fill=TRUE,skip=1,widths=widths1,blank.lines.skip=TRUE) #O18 in col 6 #marker[k]<- -999 #temp<-(y==marker[k]) b<-c("YEAR","0.63.to.0.80","plus0.63","plus1.59","COND","O18","ACCUM.m","ACCUM.sd") dimnames(y)[[2]]<-b n<-nrow(y) y<-y[n:1,] y<-ts(y,start=744,end=1984) combine<-ts.union(proxy[,14],y[,6]) combine[(1400-469):(1984-469),] #these are identical k<-14 NGDC<-y[,6] loc.out<-file.path(base,"images",paste(paste("series",k,sep=""),"png",sep=".")) png(file=loc.out,width=800,height=600,pointsize=120,bg="white"); plot.ts(NGDC,main=paste(prname[k,3])) dev.off();
15. Quelccaya 1 ice core Accumulation MBH<-proxy[,15] NGDC<-y[,7] diff<-MBH-NGDC combine<-ts.union(MBH,NGDC) output(combine,15)
16. Dunde dO18 #no digital source found k<-16 loc.out<-file.path(base,"images",paste(paste("series",k,"O",sep=""),"png",sep=".")) png(file=loc.out,width=800,height=200,pointsize=120,bg="white"); plot.ts(proxy[,16],main=paste(prname[k,3])) dev.off();
17. West Greenland Ice melt (Kameda Site J) #this is inadequate digital source in Overpeck et al. url<-"http://www.ngdc.noaa.gov/paleo/sciencepub/pale5yr.txt" h<-readLines(url,n=-1) write.table(h,file="c:/temp/g.txt",quote=FALSE) g<-read.table("c:/temp/g.txt",sep="\t",fill=TRUE) g[,82] f<-g[,c(1,4,82)] write.table(f,file="c:/temp/f.txt",quote=FALSE) h<-read.table("c:/temp/f.txt",fill=TRUE,skip=7) h<-h[,c(3,5)] h<-h[nrow(h):1,] h<-ts(h[,2],start=1600,end=1980,frequency=0.2) ts.plot(h) k<-17 MBH<-proxy[,k] loc.out<-file.path(base,"images",paste(paste("series",k,sep=""),"png",sep=".")) png(file=loc.out,width=800,height=200,pointsize=120,bg="white"); plot.ts(MBH,main=paste(prname[k,3])) dev.off(); Overpeck<-h loc.out<-file.path(base,"images",paste(paste("series",k,"O",sep=""),"png",sep=".")) png(file=loc.out,width=800,height=200,pointsize=120,bg="white"); plot.ts(Overpeck,main="Overpeck 5-year average",xlim=c(1400,1990)) dev.off();
ts.plot(proxy[,17],xlim=c(1600,1980))
k<-18 h<-read.table("c:/temp/f.txt",fill=TRUE,skip=6) h<-h[,3:4] h<-h[nrow(h):1,] h<-ts(h[,2],start=1600,end=1985,frequency=0.2) h[1]<-NA ts.plot(h) ts.plot(proxy[,18],xlim=c(1600,1985)) #in C1500 url<-"ftp://ftp.ngdc.noaa.gov/paleo/climate1500ad/ch26.txt" h<-readLines(url,n=-1) g<-h[4:566] write.table(g,file="c:/temp/g.txt",quote=FALSE) g<-read.fwf("c:/temp/g.txt",fill=TRUE,skip=1,widths=c(10,13,10,13,10,10)) g<-cbind((1987-g[,2]),g) plot( g[1:512,1] , g[1:512,5], type="l",main="Svalbard Ice Melt %") plot( g[1:259,1] , g[1:259,5], type="l",main="Svalbard Ice Melt %") loc.out<-file.path(base,"images",paste(paste("series",k,"N",sep=""),"png",sep=".")) png(file=loc.out,width=800,height=200,pointsize=120,bg="white"); plot( g[1:512,1] , g[1:512,5], type="l",main="Svalbard Ice Melt %") dev.off(); loc.out<-file.path(base,"images",paste(paste("series",k,sep=""),"png",sep=".")) png(file=loc.out,width=800,height=200,pointsize=120,bg="white"); plot.ts(proxy[,k],main=paste(prname[k,3])) dev.off();
k<-19 loc.out<-file.path(base,"images",paste(paste("series",k,sep=""),"png",sep=".")) png(file=loc.out,width=800,height=300,pointsize=120,bg="white"); plot.ts(proxy[,k],main=paste(prname[k,3])) dev.off();
20. Crete Greenland - Central Greenland Stack - mwp-5 0.05123213 NGDC to 553-1974; MBH to 553-1982. Central Greenland g<-read.table(url,skip=2,fill=TRUE) h[1:5] h<-h[nrow(h):1,2] h<-ts(h,start=553,end=1974) combine<-ts.union(h,proxy[,20],mwp[,5])
this is similar to Figure 4 of Fisher et al. 1996 url<-"ftp://ftp.ngdc.noaa.gov/paleo/icecore/greenland/gisp/crete/ct74-1y.txt" #h<-readLines(url,n=20) h<-read.table(url,skip=18) h<-h[nrow(h):1,2] h<-ts(h,start=553,end=1974) combine<-ts.union(h,proxy[,20],mwp[,5]) plot.ts(combine) 0.05123213
#this is identified with JB92 Minnesota as follows: url<-"ftp://ftp.ngdc.noaa.gov/paleo/climate1500ad/ch13.txt" h<-readLines(url,n=-1) g<-h[2370:(2369+163)] write.table(g,"c:/temp/g.txt",quote=FALSE) g<-read.table("c:/temp/g.txt",skip=1) g<-ts(g,start=1820,end=1982) #this is seasonal anomaly in deg C. Last column is annual. JB92<-g[,7] combine<-ts.union(proxy[,21],JB92]) cor(combine,use="pairwise.complete.obs")[1,2]
#0.8893867 diff<-proxy[,21]-JB92 combine<-ts.union(proxy[,21],JB92,diff) plot.ts(combine,main=paste(prname[21,3]))
22. Station temperature 47.5N, 2.5E #MBH22 is probably JB92 Paris(48.8N,2.5E), but no digital publication was located.
23. Gridbox 47.5N, 7.5E START 1753 #same location and start date as JB92 Geneva url<-"ftp://ftp.ngdc.noaa.gov/paleo/climate1500ad/ch13.txt" h<-readLines(url,n=-1) g<-h[780:(780+227)] write.table(g,"c:/temp/g.txt",quote=FALSE) g<-read.table("c:/temp/g.txt",skip=1) JB92<-ts(g[,7],start=1753,end=1980) #this is seasonal anomaly in deg C. Last column is annual. combine<-ts.union(proxy[,23],JB92) cor(combine,use="pairwise.complete.obs")[1,2]
#0.8155358 diff<-proxy[,23]-JB92 combine<-ts.union(proxy[,23],JB92,diff) plot.ts(combine,main=paste(prname[23,3]))
24. Station temperature 47.5N, 12.5 E MBH24 (47.5N, 12.5E, start 1767) is perhaps JB92 Munich (48.1,11.7E,start 1781), but no digital publication was located to verify. 25. Station temperature 47.5N, 17.5E MBH25 (47.5N, 17.5E, start 1775) is almost certainly JB92 Vienna (48.2N,16.4E,1775 start), but no digital publication was located. 26. Station temperature 52.5N, 17.5E No JB92 series correlated strongly with this series and there is no corresponding location (52.5N, 17.5E) in the JB92 table.
27. Station temperature 57.5N, 17.5E #same location and start date as JB92 Stockholm url<-"ftp://ftp.ngdc.noaa.gov/paleo/climate1500ad/ch13.txt" h<-readLines(url,n=-1) g<-h[273:(272+225)] write.table(g,"c:/temp/g.txt",quote=FALSE) g<-read.table("c:/temp/g.txt",skip=1) g<-ts(g,start=1756,end=1980) #this is seasonal anomaly in deg C. Last column is annual. combine<-ts.union(proxy[,27],g[,7]) cor(combine,use="pairwise.complete.obs")[1,2]
#0.997955 plot.ts(combine,main=paste(prname[27,3]))
28. Station temperature 57.5N, 37.5E #same location and start date as JB92 Leningrad (1750 -ignoring 1744 isolated value in JB92) g<-h[1290:(1290+237)] write.table(g,"c:/temp/g.txt",quote=FALSE) g<-read.table("c:/temp/g.txt",skip=1) temp<-(g== (-99.9)) g[temp]<-NA g<-ts(g,start=1743,end=1980) #this is seasonal anomaly in deg C. Last column is annual. combine<-ts.union(proxy[,28],g[,7]) cor(combine,use="pairwise.complete.obs")[1,2] #0.9644535 combine #same coverage other than outlying 1744 value in JB92 plot.ts(combine, main=paste(prname[28,3], " Leningrad!"))
29. Station temperature 62.5N, 7.5E No JB92 series correlated strongly with this series and there is no corresponding location (62.5N, 7.5E) in the JB92 table.
30. Gridbox 62.5N, 12.5E Trondheim url<-"ftp://ftp.ngdc.noaa.gov/paleo/climate1500ad/ch13.txt" h<-readLines(url,n=-1) g<-h[52:(52+219)] write.table(g,"c:/temp/g.txt",quote=FALSE) g<-read.table("c:/temp/g.txt",skip=1) g<-ts(g,start=1761,end=1980) #this is seasonal anomaly in deg C. Last column is annual. combine<-ts.union(proxy[,30],g[,7]) cor(combine,use="pairwise.complete.obs")[1,2] #0.9979979 combine #same coverage with start 1761 plot.ts(combine, main=paste(prname[30,3], "Trondheim"))
31. Station temperature 62.5N, 42.5E #MBH31 (62.5N, 42.5E) is potentially Arkhangel, but no digital publication was located.
#JB92 Correlations to MBH Series #JB92- CENTRAL ENGLAND g<-h[499:(498+280)] write.table(g,"c:/temp/g.txt",quote=FALSE) g<-read.table("c:/temp/g.txt",skip=1) temp<-(g== (-99.9)) g[temp]<-NA g<-ts(g,start=1701,end=1980) #this is seasonal anomaly in deg C. Last column is annual. combine<-ts.union(g[,7],proxy[,21:31]) cor(combine,use="pairwise.complete.obs")[,1:2] #>0.7 with V22 (Paris?) and >0.7 V29 (62.5N,7.5E). positive with all
#BERLIN g<-h[1010:(1009+279)] write.table(g,"c:/temp/g.txt",quote=FALSE) g<-read.table("c:/temp/g.txt",skip=1) temp<-(g== (-99.9)) g[temp]<-NA g<-ts(g,start=1701,end=1980) #this is seasonal anomaly in deg C. Last column is annual. combine<-ts.union(g,proxy[,21:31]) cor(combine,use="pairwise.complete.obs")[,1:2] #<0.1 with all series;
#SVERDLOVSK g<-h[1529:(1528+150)] write.table(g,"c:/temp/g.txt",quote=FALSE) g<-read.table("c:/temp/g.txt",skip=1) temp<-(g== (-99.9)) g[temp]<-NA g<-ts(g,start=1831,end=1980) #this is seasonal anomaly in deg C. Last column is annual. combine<-ts.union(g[,7],proxy[,21:31]) cor(combine,use="pairwise.complete.obs") #<0.53 with V31 (Arkhangel)
#TORONTO g<-h[1824:(1823+203)] write.table(g,"c:/temp/g.txt",quote=FALSE) g<-read.table("c:/temp/g.txt",skip=1) temp<-(g== (-99.9)) g[temp]<-NA g<-ts(g,start=1778,end=1980) #this is seasonal anomaly in deg C. Last column is annual. combine<-ts.union(g[,7],proxy[,21:31]) cor(combine,use="pairwise.complete.obs") #<0.6 with V21 (Minnesota)
PRECIPITATION
#identified with JB92 MARSEILLES url<-"ftp://ftp.ngdc.noaa.gov/paleo/climate1500ad/ch13.txt" #this is from normalized seasonal data at NGDCh<-readLines(url,n=-1) g<-h[3650:(3649+232)] write.table(g,"c:/temp/g.txt",quote=FALSE) g<-read.table("c:/temp/g.txt",skip=1) temp<-(g== (-99.9)) g[temp]<-NA g<-ts(g,start=1749,end=1980) #this is seasonal anomaly in deg C. Last column is annual. combine<-ts.union(proxy[,35],g[,7]) cor(combine,use="pairwise.complete.obs")[1,2]
#0.9614343
combine<-scale(combine) diff<-combine[,1]-combine[,2] combine<-ts.union(combine,diff) dimnames(combine)[[2]]<-c("MBH","JB92","diff") plot.ts(combine,main=paste(prname[35,3], " !Marseilles"))
37. Grid box 42.5N,72.5W ! JB92 Paris url<-"ftp://ftp.ngdc.noaa.gov/paleo/climate1500ad/ch13.txt" h<-readLines(url,n=-1) g<-h[3438:(3437+211)] write.table(g,"c:/temp/g.txt",quote=FALSE) g<-read.table("c:/temp/g.txt",skip=1) JB92<-ts(g[,7],start=1770,end=1980) #. Last column is annual. combine<-ts.union(JB92,proxy[,32:42]) cor(combine,use="pairwise.complete.obs")[,1:2] #this shows 0.9205803485 correlation with MBH37
MBH<-proxy[,37] combine<-ts.union(MBH,JB92) combine<-scale(combine) diff<-combine[,1]-combine[,2] combine<-ts.union(combine,diff) plot.ts(combine,ann=FALSE)
#HOOFDORP url<-"ftp://ftp.ngdc.noaa.gov/paleo/climate1500ad/ch13.txt" #this is from normalized seasonal data at NGDC h<-readLines(url,n=-1) g<-h[3198:(3197+239)] write.table(g,"c:/temp/g.txt",quote=FALSE) g<-read.table("c:/temp/g.txt",skip=1) g<-ts(g,start=1735,end=1973) #this is seasonal anomaly in deg C. Last column is annual. combine<-ts.union(g[,7],proxy[,32:42]) cor(combine,use="pairwise.complete.obs") #0.4 correlation with proxies 37 (Paris!) and 40 (Prague ?) is highest
#CHARLESTON url<-"ftp://ftp.ngdc.noaa.gov/paleo/climate1500ad/ch13.txt" h<-readLines(url,n=-1) g<-h[4793:(4792+243)] write.table(g,"c:/temp/g.txt",quote=FALSE) g<-read.table("c:/temp/g.txt",skip=1) temp<-(g== (-99.9)) g[temp]<-NA g<-ts(g,start=1738,end=1980) #this is seasonal anomaly in deg C. Last column is annual. combine<-ts.union(g[,7],proxy[,32:42]) cor(combine,use="pairwise.complete.obs") #<0.1 correlation with any proxy series.
#ALBANY url<-"ftp://ftp.ngdc.noaa.gov/paleo/climate1500ad/ch13.txt" h<-readLines(url,n=-1) g<-h[5037:(5036+152)] write.table(g,"c:/temp/g.txt",quote=FALSE) g<-read.table("c:/temp/g.txt",skip=1) temp<-(g== (-99.9)) g[temp]<-NA g<-ts(g,start=1826,end=1977) #this is seasonal anomaly in deg C. Last column is annual. combine<-ts.union(g[,7],proxy[,32:42]) cor(combine,use="pairwise.complete.obs") #0.925 only with annual precipitation #highest is about 0.4 correlation with V33 (Bombay?) and V36
#PADUA url<-"ftp://ftp.ngdc.noaa.gov/paleo/climate1500ad/ch13.txt" h<-readLines(url,n=-1) g<-h[4300:(4299+250)] write.table(g,"c:/temp/g.txt",quote=FALSE) g<-read.table("c:/temp/g.txt",skip=1) temp<-(g== (-99.9)) g[temp]<-NA g<-ts(g,start=1735,end=1974) # combine<-ts.union(g[,7],proxy[,32:42]) cor(combine,use="pairwise.complete.obs") #0.925 only with annual precipitation #<0.1 correlations with any proxy series
#MILAN url<-"ftp://ftp.ngdc.noaa.gov/paleo/climate1500ad/ch13.txt" h<-readLines(url,n=-1) g<-h[4082:(4081+217)] write.table(g,"c:/temp/g.txt",quote=FALSE) g<-read.table("c:/temp/g.txt",skip=1) temp<-(g== (-99.9)) g[temp]<-NA g<-ts(g,start=1764,end=1980) # combine<-ts.union(g[,7],proxy[,32:42]) cor(combine,use="pairwise.complete.obs") #0.925 only with annual precipitation #0.4 with V35 (Marseilles!) is highest
#KARLSRUHE g<-h[3883:(3882+198)] write.table(g,"c:/temp/g.txt",quote=FALSE) g<-read.table("c:/temp/g.txt",skip=1) temp<-(g== (-99.9)) g[temp]<-NA g<-ts(g,start=1779,end=1976) # combine<-ts.union(g[,7],proxy[,32:42]) cor(combine,use="pairwise.complete.obs") #0.925 only with annual precipitation #0.6 with V37 (Paris!) is highest
#ENGLAND AND WALES g<-h[2540:(2539+223)] write.table(g,"c:/temp/g.txt",quote=FALSE) g<-read.table("c:/temp/g.txt",skip=1,blank.lines.skip=TRUE) temp<-(g== (-99.9)) g[temp]<-NA g<-ts(g,start=1766,end=1987) # combine<-ts.union(g[,7],proxy[,32:42]) cor(combine,use="pairwise.complete.obs") #0.925 only with annual precipitation #0.42 with V37 (Paris!) and V40 (Prague?) is highest
#LUND g<-h[2968:(2967+229)] write.table(g,"c:/temp/g.txt",quote=FALSE) g<-read.table("c:/temp/g.txt",skip=1,blank.lines.skip=TRUE) temp<-(g== (-99.9)) g[temp]<-NA g<-ts(g,start=1748,end=1976) # combine<-ts.union(g[,7],proxy[,32:42]) cor(combine,use="pairwise.complete.obs") #0.925 only with annual precipitation #0.34 with V40 (Prague?) is highest
#UPPSALA g<-h[2764:(2763+203)] write.table(g,"c:/temp/g.txt",quote=FALSE) g<-read.table("c:/temp/g.txt",skip=1,blank.lines.skip=TRUE) temp<-(g== (-99.9)) g[temp]<-NA g<-ts(g,start=1774,end=1976) # combine<-ts.union(g[,7],proxy[,32:42]) cor(combine,use="pairwise.complete.obs") #0.925 only with annual precipitation #0.29 with V40 (PRague?) is highest
#LENINGRAD g<-h[4551:(4550+241)] write.table(g,"c:/temp/g.txt",quote=FALSE) g<-read.table("c:/temp/g.txt",skip=1,blank.lines.skip=TRUE) temp<-(g== (-99.9)) g[temp]<-NA g<-ts(g,start=1748,end=1976) # combine<-ts.union(g[,7],proxy[,32:42]) cor(combine,use="pairwise.complete.obs") #0.925 only with annual precipitation #0.19 with V34 is highest
TREE TEMP RECONSTRUCTIONS url<-"ftp://ftp.ngdc.noaa.gov/paleo/treering/reconstructions/tasmania/tasmania_recon.txt" h<-readLines(url,n=-1) g<-read.table(url,skip=57) f<-g[3001:3592,] f<-ts(f,start=1400,end=1991) f<-ts.union(f,proxy[,43]) f #ARFILT is in column 2 and is described by authors as more accurate new[,43]<-f[,2] cor(f,use="pairwise.complete.obs") #0.925 only with annual precipitation correlation only 0.88 with MBH fred<-f[,3]-f[,4] fred f<-cbind(f, fred) plot.ts(f[,2:5],main=paste(prname[43,3]))
44. JAVA no data
url<-"ftp://ftp.ngdc.noaa.gov/paleo/climate1500ad/ch24.txt" h<-readLines(url,n=-1) g<-h[66:90] write.table(g,file="c:/temp/g.txt",quote=FALSE) g<-read.table("c:/temp/g.txt",skip=1,fill=TRUE) g<-g[,3:12] g<-t(g) g<-c(g) g<-ts(g,start=1730,end=1978) f<-ts.union(g,proxy[,45]) f Exact match to 4: Reconstructed summer (Dec-March) temperature values from Nothofagus spp. with 2 plugs at end.#new[,45]<-f[,1] url<-"ftp://ftp.ngdc.noaa.gov/paleo/treering/reconstructions/newzealand/nztemp_data.txt" h<-readLines(url,n=-1) g<-h[45:312] write.table(g,file="c:/temp/g.txt",quote=FALSE) g<-read.table("c:/temp/g.txt",skip=1,fill=TRUE) NP2000<-ts(g,start=1720,end=1987) NP2000<-NP2000[,3] MBH<-f[,2] NP1992<-f[,1] f<-ts.union(MBH,NP2000,NP1992) dim(f) plot.ts(f,main="NZ Reconstructions") New NZ series availableup to 1987 with strong decline in 1980s new[,45]<-f[,3]
46 - cpatagonia in BACKTO1820. 41S in data_supp back to 1500. url<-"ftp://ftp.ngdc.noaa.gov/paleo/climate1500ad/ch23.txt" h<-readLines(url,n=-1) g<-h[187:234] # NORTHEN PATAGONIA TEMP. DEVIATION RECONSTRUCTED (IN CELSIUS DEGREES)write.table(g,file="c:/temp/g.txt",quote=FALSE) g<-read.table("c:/temp/g.txt",skip=1,fill=TRUE) g<-g[,3:12] #this is1500 to 1980 g<-t(g) g<-c(g) g<-ts(g,start=1500,end=1979) f<-ts.union(g,proxy[,46]) f Exact match with plugs from 1975 to 1980. Note that label in BACK TO is inconsistent
47- npatagonia 38S in data_supp. back to 869. #MBH has 100 years earlier than C1500
kolyma<-c("russ132w_crns.crn", "russ089w_crns.crn", "russ102w_crns.crn") base<-"c:/climate/data/tree/r/asia" loc<-file.path(base,paste(kolyma[1],"tab",sep=".") ) load(loc) f<-chron.crn loc<-file.path(base,paste(kolyma[2],"tab",sep=".") ) f1<-chron.crn loc<-file.path(base,paste(kolyma[3],"tab",sep=".") ) f2<-chron.crn f<-ts.union(f,f1,f2,proxy[,48]) plot.ts(f,main=paste(prname[48,3])
kol<-c("russ147w_crns.crn", "russ148w_crns.crn", "russ138w_crns.crn", "russ143w_crns.crn", "russ141w_crns.crn", "russ134w_crns.crn", "russ070w_crns.crn") base<-"c:/climate/data/tree/r/asia" f<-proxy[,48] for (k in 1:7) { loc<-file.path(base,paste(kol[k],"tab",sep=".") ) load(loc) f<-ts.union(f,chron.crn) } plot.ts(f,main=paste(prname[48,3])) cor(f,use="pairwise.complete.obs") max is 0.63 with ko[6] #no obvious comparison
can be recovered exactly url<-"ftp://ftp.ngdc.noaa.gov/paleo/treering/reconstructions/westnamerica/briffa1992/briffa1992.txt" h<-readLines(url,n=-1) g<-h[727:876] write.table(g,file="c:/temp/g.txt",quote=FALSE) g<-read.table("c:/temp/g.txt",fill=TRUE,skip=1) dim(g) briffa<-g[,7] #1600 to 1749 g<-h[877:1109] write.table(g,file="c:/temp/g.txt",quote=FALSE) g<-read.table("c:/temp/g.txt",fill=TRUE,skip=1) dim(g)#233x12 briffa<-c(briffa,g[,12]) briffa<-ts(briffa,start=1600,end=1982) combine<-ts.union(briffa,proxy[,49]) combine 50. FRITTS coerced to Briffa from 1963 on new[564:585,50]<-NA
51:61 JACOBY These scripts presuppose that the NGDC decadal format data have been loaded into R-table time series. #JACOBY TREELINE SERIES 51-61 # some setup for all these series base<-"c:/climate/data/mann/tree.id" loc<-file.path(base,"jacoby.txt") idtemp<-readLines(loc) pathinfo<-"c:/climate/data/tree/r/northamerica"
#correlation is not exact #ftp://ftp.ngdc.noaa.gov/paleo/treering/chronologies/northamerica/usa/ak031.crn k<-51 load(file.path(pathinfo,paste(idtemp[k-50],"crn.tab",sep="."))) tree<-chron.crn diff<-1000*proxy[,k]-tree f<-ts.union(proxy[,k],tree) cor(f,use="pairwise.complete.obs") #proxy[, k] tree
#NGDC has later values f[551:591,] #shows series together from 1950 to 1990
#plot shows MBH increasing discrepancies plot.ts(f,main=paste(prname[k,3]))
#ftp://ftp.ngdc.noaa.gov/paleo/treering/chronologies/northamerica/canada/cana002.crn k<-52 load(file.path(pathinfo,paste(idtemp[k-50],"crn.tab",sep="."))) tree<-chron.crn diff<-1000*proxy[,k]-tree f<-ts.union(proxy[,k],tree) cor(f,use="pairwise.complete.obs") #proxy[, k] tree
#NGDC has later values f[551:591,] #shows series together from 1950 to 1990
#plot shows MBH increasing discrepancies plot.ts(f,main=paste(prname[k,3]))
53. Gaspe PQ #ftp://ftp.ngdc.noaa.gov/paleo/treering/chronologies/northamerica/canada/cana036.crn #MBH plug 1400-1404. Otherwise matches NGDC series, which ends in 1984. k<-53 load(file.path(pathinfo,paste(idtemp[k-50],"crn.tab",sep="."))) tree<-chron.crn plot.ts(tree,main=paste(prname[k,3]))
#ftp://ftp.ngdc.noaa.gov/paleo/treering/chronologies/northamerica/usa/ak032.crn k<-54 load(file.path(pathinfo,paste(idtemp[k-50],"crn.tab",sep="."))) tree<-chron.crn diff<-1000*proxy[,k]-tree f<-ts.union(proxy[,k],tree) cor(f,use="pairwise.complete.obs")[1,2] # 0.9590485
#NGDC has later values f[551:593,] #shows series together from 1950 to 1990
#plot shows MBH discrepancies plot.ts(f,main=paste(prname[k,3]))
#ftp://ftp.ngdc.noaa.gov/paleo/treering/chronologies/northamerica/usa/ak033.crn k<-55 load(file.path(pathinfo,paste(idtemp[k-50],"crn.tab",sep="."))) tree<-chron.crn diff<-1000*proxy[,k]-tree f<-ts.union(proxy[,k],tree) cor(f,use="pairwise.complete.obs")[1,2] # 0.7021759
#NGDC does not have later values f[551:593,] #shows series together from 1950 to 1990
#plot shows MBH discrepancies plot.ts(f,main=paste(prname[k,3]))
#ftp://ftp.ngdc.noaa.gov/paleo/treering/chronologies/northamerica/canada/cana157.crn k<-56 load(file.path(pathinfo,paste(idtemp[k-50],"crn.tab",sep="."))) tree<-chron.crn diff<-1000*proxy[,k]-tree f<-ts.union(proxy[,k],tree) cor(f,use="pairwise.complete.obs")[1,2] # 0.6989663
#NGDC does not have later values f[551:593,] #shows series together from 1950 to 1990
#plot shows MBH discrepancies plot.ts(f,main=paste(prname[k,3]))
57. Mackenzie Mts, Canada #ftp://ftp.ngdc.noaa.gov/paleo/treering/chronologies/northamerica/canada/cana156.crn k<-57 load(file.path(pathinfo,paste(idtemp[k-50],"crn.tab",sep="."))) tree<-chron.crn plot.ts(tree,main=paste(prname[k,3]))
#ftp://ftp.ngdc.noaa.gov/paleo/treering/chronologies/northamerica/canada/cana153.crn k<-58 load(file.path(pathinfo,paste(idtemp[k-50],"crn.tab",sep="."))) tree<-chron.crn diff<-1000*proxy[,k]-tree f<-ts.union(proxy[,k],tree) cor(f,use="pairwise.complete.obs")[1,2]
# 0.9905832
#NGDC does not have later values f[551:593,] #shows series together from 1950 to 1990
#plot shows MBH discrepancies plot.ts(f,main=paste(prname[k,3]))
59 Hornby Cabin, Canada #ftp://ftp.ngdc.noaa.gov/paleo/treering/chronologies/northamerica/canada/cana155.crn k<-59 load(file.path(pathinfo,paste(idtemp[k-50],"crn.tab",sep="."))) tree<-chron.crn plot.ts(tree,main=paste(prname[k,3]))
60. Churchill, Canada #ftp://ftp.ngdc.noaa.gov/paleo/treering/chronologies/northamerica/canada/cana158.crn k<-60 load(file.path(pathinfo,paste(idtemp[k-50],"crn.tab",sep="."))) tree<-chron.crn plot.ts(tree,main=paste(prname[k,3]))
61. Castle Penin, Canada #ftp://ftp.ngdc.noaa.gov/paleo/treering/chronologies/northamerica/canada/cana159.crn k<-61 load(file.path(pathinfo,paste(idtemp[k-50],"crn.tab",sep="."))) tree<-chron.crn plot.ts(tree,main=paste(prname[k,3]))
all updated rl<-"ftp://ftp.ngdc.noaa.gov/paleo/treering/chronologies/northamerica/usa/ak031.crn"
62-64. GEORGIA Stahle et al 1988(precip) These three series are estimates of spring rainfall by state. No NGDC comparandum. contains PAlmer PDSI index se<-c("ga002.crn", "ga003.crn", "ga004.crn") base<-base<-"c:/climate/data/tree/r2/northamerica" f<-proxy[,64] for (k in 1:3) { loc<-file.path(base,paste(se[k],"tab",sep=".") ) load(loc) f<-ts.union(f,chron.crn) } plot.ts(f,main=paste(prname[64,3])) #no obvious comparison
se<-"sc004.crn" base<-base<-"c:/climate/data/tree/r2/northamerica" f<-proxy[,64] loc<-file.path(base,paste(se,"tab",sep=".") ) load(loc) f<-ts.union(f,chron.crn) } plot.ts(f,main=paste(prname[63,3])) #no obvious comparison
url<- k<-65 se<-"mong003.crn" base2<-"c:/climate/data/tree/r/asia" MBH<-proxy[,65] loc<-file.path(base2,paste(se,"tab",sep=".") ) load(loc) NGDC<-chron.crn f<-ts.union(MBH,NGDC) cor(f,use="pairwise.complete.obs")[1,2]#0.9426322 diff<-1000*f[,1]-f[,2] combine<-ts.union(MBH,NGDC,diff) output(combine,65)
#NGDC starts earlier. not exact transcription. MBH is over-estimate in 20th century trends. THis is important contributor.
66. Yakutia 62N,130E Hughes 1998. start 1400 #this reproduces Figure 5 of Hughes 1998. #search on 125-145E NGDC between 128 and 132E. One at 67,130; one at 62,129. Yakutsk.se<-"russ142w_crns.crn" base<-"c:/climate/data/tree/r/asia" MBH<-proxy[,66] loc<-file.path(base,paste(se,"tab",sep=".") ) load(loc) NGDC<-chron.crn f<-ts.union(NGDC,MBH) cor(f,use="pairwise.complete.obs") #0.80 plot.ts(f,main=paste(prname[66,3])) #MBH is not normalized. It is divided by 1000. #MBH<-1000*MBH #diff<-MBH-NGDC f<-cbind(f,diff) plot.ts(f,main=paste(prname[65,3])) MBH is a T-reconstruction not a proxy. NGDC Yakutsck only 1730-1991 vs NGDC 1400-1994. Hughes did not contribute to NGDC
Fudge in Briffa Fig 7. Residuals in Fig 7 are autocorrelated throughout series. Estimated - actual are negative in 20th century. So 20th century residuals only are coerced. Tornetrask data. url<-"ftp://ftp.ngdc.noaa.gov/paleo/climate1500ad/ch19.txt" h<-readLines(url,n=-1) g<-h[510:549] write.table(g,file="c:/temp/g.txt",quote=FALSE) g<-read.table("c:/temp/g.txt",skip=1,fill=TRUE) g<-g[,2:11] g<-t(g) g<-c(g) g<-ts(g,start=1580,end=1580+length(g)) ts.plot(g) #this is 1580-1980 MBH<-proxy[,67] f<-ts.union(g,MBH) cor - only 0.68 plot.ts(f,main=paste(prname[67,3])) fred<-lowess(proxy[,67][!is.na(proxy[,67])],f=10/600) plot(fred,type="l")#this loks sort of like Fig. 8 in Clim Dyn. the April-August reconstruction based on "corrected" sites
#update for NEUR at ftp://ftp.ngdc.noaa.gov/paleo/treering/reconstructions/n_hem_temp/briffa2001jgr2.txt swed019w_crns.crn se<-"swed019x_crns.crn" #density base<-"c:/climate/data/tree/r/europe" MBH<-proxy[,67] loc<-file.path(base,paste(se,"tab",sep=".") ) load(loc) NGDC<-chron.crn Br2001<-g[,2] f<-ts.union(NGDC,MBH,Br2001) plot.ts(f,main=paste(prname[67,3])) f.NGDC f.MBH g[, 2] f.NGDC 1.0000000 0.8694270 0.3707846 f.MBH 0.8694270 1.0000000 0.4248721 g[, 2] 0.3707846 0.4248721 1.0000000 smooth<-ts(lowess(MBH[!is.na(MBH)],f=10/600)$y,start=tsp(MBH)[1],end=tsp(MBH)[2]) ts.plot(MBH,smooth,main=paste(prname[67,3]),xlim=c(1400,2000),col=c("yellow","black","black"),cex=0)
cor(f,use="pairwise.complete.obs") #correlation of 0.87 with Tornetrask MXD series. MBH is g<-scale(f) plot.ts(g,main=paste(prname[67,3]),xlim=c(1400,2000)) cor(f,use="pairwise.complete.obs") #MBH goes to 1997 - a little later than CD Fig 7 #MBH is not normalized. It is divided by 1000. #MBH<-1000*MBH #diff<-MBH-NGDC f<-cbind(f,diff) plot.ts(f,main=paste(prname[65,3])) MBH is a T-reconstruction not a proxy. NGDC Yakutsck only 1730-1991 vs NGDC 1400-1994. Hughes did not contribute to NGDC little correlaition between MBH and Briffa et al in V1500
url<-"ftp://ftp.ngdc.noaa.gov/paleo/treering/reconstructions/n_hem_temp/briffa2001jgr2.txt" h<-readLines(url,n=-1) h[1:25]#skip 23 g<-read.table(url,fill=TRUE,skip=23) temp<-(g< (-90)) g[temp]<-NA g<-ts(g,start=1400,end=1994) b<-c("Year","NEUR", "SEUR", "NSIB", "ESIB", "CAS", "TIBP", "WNA", "NWNA" ,"ECCA") dimnames(g)[[2]]<-b f<-ts.union(proxy[,68],g[,4]) cor(f,use="pairwise.complete.obs")# 0.4948752 plot.ts(f,main=paste(prname[68,3]))
ftp://ftp.ngdc.noaa.gov/paleo/climate1500ad/ch19.txt
PRINCIPAL COMPONENTS see script proxy.pc.summary
HIGH TREE NUMBERS region<-c("northamerica","northamerica","northamerica","southamerica","australia","europe","africa","asia") site<-c("CHIN004", "CHIN004X", "FRAN009", "FRAN010", "FRAN011", "INDI002X", "MEXI001" , "morc011", "morc001", "morc014", "SPAI011", "SPAI012", "SWED002") #.not MORO004, MORO001,MORO008, indi008X,swed002b #CHIN004 site<-casefold(site) base<-"c:/climate/data/tree/r" reg<-c(8,8,6,6,6,8,3,7,7,7,6,6,6)
#for (k in 1:length(site)) { k<-1 base<-"c:/climate/data/tree/r" reg<-c(8,8,6,6,6,8,3,7,7,7,6,6,6) #for (k in 1:length(site)) {
MBH 1540-1989 110.08 34.48 "X. D. Wu, X. M. Shao, M. K. Hughes, J. M. Burns, G. M. Garfin"Huashan (CHN; 34N,110E; Wu,X.D.;Shao,X.M.;Hughes,M.K.;Burns,J.M.;Garfin,G.M.) 1540-1989 loc<-file.path(base,region[reg[k]],paste(site[k],"crn","tab",sep=".") ) load(loc) NGDC<-chron.crn MBH<-proxy[,99+k] f<-ts.union(NGDC,MBH) f new[,100]<-f[,1] #similarly k=6 for 105 new[,105]<-f[,1] #similarly for k=13, 112 new[,112]<-f[,1] proxy<-new save(proxy,file="c:/climate/data/mann/proxy4.tab")
plot.ts(f,main=paste(prname[99+k,3])) cor(f,use="pairwise.complete.obs") pairwise identical except for 2 hot values at start of chinese series. MBH=1000*
101. CHIN04 MBH 1560-1988 MXD 110.08 34.48 "X. D. Wu, X. M. Shao, M. K. Hughes, J. M. Burns, G. M. Garfin"Huashan (CHN; 34N,110E; Wu,X.D.;Shao,X.M.;Hughes,M.K.;Burns,J.M.;Garfin,G.M.) 1540-1989 #pairwise identical k<-2 loc<-file.path(base,region[reg[k]],paste(site[k],"crn","tab",sep=".") ) load(loc) NGDC<-chron.crn MBH<-proxy[,99+k] f<-ts.union(NGDC,MBH) plot.ts(f,main=paste(prname[99+k,3])) cor(f,use="pairwise.complete.obs") pairwise identical except for 2 hot values at start of chinese series. MBH=1000*
102. k<-3 FRAN009 - identical loc<-file.path(base,region[reg[k]],paste(site[k],"crn","tab",sep=".") ) load(loc) NGDC<-chron.crn MBH<-proxy[,99+k] f<-ts.union(NGDC,MBH) plot.ts(f,main=paste(prname[99+k,3])) cor(f,use="pairwise.complete.obs") 103. k<-4 identical. ends in 1974. no plugs. 104. k<-5 identical no plugs ends 1973
k<-105 site<-"indi002x" base2<-"c:/climate/data/tree/r/asia" loc<-file.path(base2,paste(site,"crn","tab",sep=".") ) load(loc) NGDC<-chron.crn MBH<-proxy[,k] f<-ts.union(MBH,NGDC) plot.ts(f,main=paste(prname[k,3])) cor(f,use="pairwise.complete.obs")[1,2]#0.8343586 diff<-1000*MBH-NGDC f<-ts.union(MBH,NGDC,diff) output(f,105)
106. mexi001 identical. ends in 1971. no plugs
107. mor003 1549 . -5.03 33.45#morc011.crn complete identity. series to 1984. 108. complete identity to morc001.sharp decrease at end. peak in 1963.
109. morc014, Col du Zad. 100% identity sharp decline at end. negative coefficient
110 spai011. 100% identity. to 1988. big earaly spike 111. spai012. 100% identity to 1988
112. swed002 (instead of swed002b. correlaiton is 0.977. ends 1972 k<-112 site<-"swed002" base2<-"c:/climate/data/tree/r/europe" loc<-file.path(base2,paste(site,"crn","tab",sep=".") ) load(loc) NGDC<-chron.crn MBH<-proxy[,k] f<-ts.union(MBH,NGDC) plot.ts(f,main=paste(prname[k,3])) cor(f,use="pairwise.complete.obs")[1,2]#0.9771174 diff<-1000*MBH-NGDC f<-ts.union(MBH,NGDC,diff) output(f,112)
|