# File: graphsEU.r - R program # Purpose: Upload Eurostat data for current business cycle, graph data, export graphs to pdf. # Author: Valerie Bostwick # Date last edited: 09.27.2012 ########################################## Parameters & Functions ############################################# #working.dir <- "/Users/vkbostwick/Documents/Rupert" # Set working directory #For Mac: #clear memory #rm(list=ls()) #setwd("/Users/vkbostwick/documents/Rupert") system("open /Applications/Utilities/X11.app") system("open /Applications/Utilities/XQuartz.app") hpfilter <- function(x,lambda){ eye <- diag(length(x)) result <- solve(eye+lambda*crossprod(diff(eye,lag=1,d=2)),x) return(result) } #Start directory in EU folder setwd("~/Dropbox/rupert/EU") #Create new folder and name it the current date system(paste("rm","-R",Sys.Date())) system(paste("mkdir",Sys.Date())) #Creat a new folder for .png images and -presentation.pdf images. system(paste("mkdir",paste(Sys.Date(),"/png",sep=""))) system(paste("mkdir",paste(Sys.Date(),"/pdf_presentation",sep=""))) #Change working directory to the newly created folder setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),sep="")) ##For Windows: # ##clear memory #rm(list=ls()) # #setwd("H:/Rupert") hpfilter <- function(x,lambda){ eye <- diag(length(x)) result <- solve(eye+lambda*crossprod(diff(eye,lag=1,d=2)),x) return(result) } ################################### Aggregate GDP Series - NIPA ######################################## #Download bulk dataset from Eurostat for Real GDP & all Real GDP components rm(data) temp <- tempfile() download.file("http://epp.eurostat.ec.europa.eu/NavTree_prod/everybody/BulkDownloadListing?sort=1&file=data%2Fnamq_gdp_k.tsv.gz",temp) data <- read.delim(gzfile(temp), header=FALSE, row.names=1, stringsAsFactors=FALSE,na.strings=": ") unlink(temp) data<-t(data) #NOTE: All of these variables are seasonally adjusted and in 2005 chain-linked euros #Real GDP rm(gdp) gdp<-data.frame(row.names=data[,"s_adj,unit,indic_na,geo\\time"]) #Real GDP rm(gdp) gdp<-data.frame(row.names=data[,"s_adj,unit,indic_na,geo\\time"]) gdp$DEreal<-ts(data[nrow(data):1,"SWDA,MIO_EUR_CLV2005,B1GM,DE"], start=c(1955,1), deltat=1/4) gdp$FRreal<-ts(data[nrow(data):1,"SWDA,MIO_EUR_CLV2005,B1GM,FR"], start=c(1955,1), deltat=1/4) gdp$UKreal<-ts(data[nrow(data):1,"SWDA,MIO_EUR_CLV2005,B1GM,UK"], start=c(1955,1), deltat=1/4) gdp$ESreal<-ts(data[nrow(data):1,"SWDA,MIO_EUR_CLV2005,B1GM,ES"], start=c(1955,1), deltat=1/4) gdp$ITreal<-ts(data[nrow(data):1,"SWDA,MIO_EUR_CLV2005,B1GM,IT"], start=c(1955,1), deltat=1/4) gdp$NLreal<-ts(data[nrow(data):1,"SWDA,MIO_EUR_CLV2005,B1GM,NL"], start=c(1955,1), deltat=1/4) gdp$USreal<-ts(data[nrow(data):1,"SWDA,MIO_EUR_CLV2005,B1GM,US"], start=c(1955,1), deltat=1/4) #Real Private Final Consumption Expenditure gdp$DEcons<-ts(data[nrow(data):1,"SWDA,MIO_EUR_CLV2005,P31_S14_S15,DE"], start=c(1955,1), deltat=1/4) gdp$FRcons<-ts(data[nrow(data):1,"SWDA,MIO_EUR_CLV2005,P31_S14_S15,FR"], start=c(1955,1), deltat=1/4) gdp$UKcons<-ts(data[nrow(data):1,"SWDA,MIO_EUR_CLV2005,P31_S14_S15,UK"], start=c(1955,1), deltat=1/4) gdp$EScons<-ts(data[nrow(data):1,"SWDA,MIO_EUR_CLV2005,P31_S14_S15,ES"], start=c(1955,1), deltat=1/4) gdp$ITcons<-ts(data[nrow(data):1,"SWDA,MIO_EUR_CLV2005,P31_S14_S15,IT"], start=c(1955,1), deltat=1/4) gdp$NLcons<-ts(data[nrow(data):1,"SWDA,MIO_EUR_CLV2005,P31_S14_S15,NL"], start=c(1955,1), deltat=1/4) gdp$UScons<-ts(data[nrow(data):1,"SWDA,MIO_EUR_CLV2005,P31_S14_S15,US"], start=c(1955,1), deltat=1/4) #Real Final Consumption Expenditures of General Government gdp$DEgov<-ts(data[nrow(data):1,"SWDA,MIO_EUR_CLV2005,P3_S13,DE"], start=c(1955,1), deltat=1/4) gdp$FRgov<-ts(data[nrow(data):1,"SWDA,MIO_EUR_CLV2005,P3_S13,FR"], start=c(1955,1), deltat=1/4) gdp$UKgov<-ts(data[nrow(data):1,"SWDA,MIO_EUR_CLV2005,P3_S13,UK"], start=c(1955,1), deltat=1/4) gdp$ESgov<-ts(data[nrow(data):1,"SWDA,MIO_EUR_CLV2005,P3_S13,ES"], start=c(1955,1), deltat=1/4) gdp$ITgov<-ts(data[nrow(data):1,"SWDA,MIO_EUR_CLV2005,P3_S13,IT"], start=c(1955,1), deltat=1/4) gdp$NLgov<-ts(data[nrow(data):1,"SWDA,MIO_EUR_CLV2005,P3_S13,NL"], start=c(1955,1), deltat=1/4) gdp$USgov<-ts(data[nrow(data):1,"SWDA,MIO_EUR_CLV2005,P3_S13,US"], start=c(1955,1), deltat=1/4) #Real Gross Capital Formation gdp$DEcapf<-ts(data[nrow(data):1,"SWDA,MIO_EUR_CLV2005,P5,DE"], start=c(1955,1), deltat=1/4) gdp$FRcapf<-ts(data[nrow(data):1,"SWDA,MIO_EUR_CLV2005,P5,FR"], start=c(1955,1), deltat=1/4) gdp$UKcapf<-ts(data[nrow(data):1,"SWDA,MIO_EUR_CLV2005,P5,UK"], start=c(1955,1), deltat=1/4) gdp$EScapf<-ts(data[nrow(data):1,"SWDA,MIO_EUR_CLV2005,P5,ES"], start=c(1955,1), deltat=1/4) gdp$ITcapf<-ts(data[nrow(data):1,"SWDA,MIO_EUR_CLV2005,P5,IT"], start=c(1955,1), deltat=1/4) gdp$NLcapf<-ts(data[nrow(data):1,"SWDA,MIO_EUR_CLV2005,P5,NL"], start=c(1955,1), deltat=1/4) gdp$UScapf<-ts(data[nrow(data):1,"SWDA,MIO_EUR_CLV2005,P5,US"], start=c(1955,1), deltat=1/4) #Consumption + Investment gdp$DEconsinv <- ts(as.numeric(gdp$DEcons)+as.numeric(gdp$DEcapf),start=c(1955,1),deltat=1/4) gdp$FRconsinv <- ts(as.numeric(gdp$FRcons)+as.numeric(gdp$FRcapf),start=c(1955,1),deltat=1/4) gdp$UKconsinv <- ts(as.numeric(gdp$UKcons)+as.numeric(gdp$UKcapf),start=c(1955,1),deltat=1/4) gdp$ESconsinv <- ts(as.numeric(gdp$EScons)+as.numeric(gdp$EScapf),start=c(1955,1),deltat=1/4) gdp$ITconsinv <- ts(as.numeric(gdp$ITcons)+as.numeric(gdp$ITcapf),start=c(1955,1),deltat=1/4) gdp$NLconsinv <- ts(as.numeric(gdp$NLcons)+as.numeric(gdp$NLcapf),start=c(1955,1),deltat=1/4) gdp$USconsinv <- ts(as.numeric(gdp$UScons)+as.numeric(gdp$UScapf),start=c(1955,1),deltat=1/4) #Real Exports of Goods & Services gdp$DEexp<-ts(data[nrow(data):1,"SWDA,MIO_EUR_CLV2005,P6,DE"], start=c(1955,1), deltat=1/4) gdp$FRexp<-ts(data[nrow(data):1,"SWDA,MIO_EUR_CLV2005,P6,FR"], start=c(1955,1), deltat=1/4) gdp$UKexp<-ts(data[nrow(data):1,"SWDA,MIO_EUR_CLV2005,P6,UK"], start=c(1955,1), deltat=1/4) gdp$ESexp<-ts(data[nrow(data):1,"SWDA,MIO_EUR_CLV2005,P6,ES"], start=c(1955,1), deltat=1/4) gdp$ITexp<-ts(data[nrow(data):1,"SWDA,MIO_EUR_CLV2005,P6,IT"], start=c(1955,1), deltat=1/4) gdp$NLexp<-ts(data[nrow(data):1,"SWDA,MIO_EUR_CLV2005,P6,NL"], start=c(1955,1), deltat=1/4) gdp$USexp<-ts(data[nrow(data):1,"SWDA,MIO_EUR_CLV2005,P6,US"], start=c(1955,1), deltat=1/4) #Real Imports of Goods & Services gdp$DEimp<-ts(data[nrow(data):1,"SWDA,MIO_EUR_CLV2005,P7,DE"], start=c(1955,1), deltat=1/4) gdp$FRimp<-ts(data[nrow(data):1,"SWDA,MIO_EUR_CLV2005,P7,FR"], start=c(1955,1), deltat=1/4) gdp$UKimp<-ts(data[nrow(data):1,"SWDA,MIO_EUR_CLV2005,P7,UK"], start=c(1955,1), deltat=1/4) gdp$ESimp<-ts(data[nrow(data):1,"SWDA,MIO_EUR_CLV2005,P7,ES"], start=c(1955,1), deltat=1/4) gdp$ITimp<-ts(data[nrow(data):1,"SWDA,MIO_EUR_CLV2005,P7,IT"], start=c(1955,1), deltat=1/4) gdp$NLimp<-ts(data[nrow(data):1,"SWDA,MIO_EUR_CLV2005,P7,NL"], start=c(1955,1), deltat=1/4) gdp$USimp<-ts(data[nrow(data):1,"SWDA,MIO_EUR_CLV2005,P7,US"], start=c(1955,1), deltat=1/4) #Download bulk dataset from Eurostat for Real Gross Fixed Capital Formation by Asset rm(data) temp <- tempfile() download.file("http://epp.eurostat.ec.europa.eu/NavTree_prod/everybody/BulkDownloadListing?sort=1&file=data%2Fnamq_pi6_k.tsv.gz",temp) data <- read.delim(gzfile(temp), header=FALSE, row.names=1, stringsAsFactors=FALSE,na.strings=": ") data<-t(data) unlink(temp) #NOTE: All of these variables are seasonally adjusted and in 2005 chain-linked euros #Residential Fixed Capital Formation gdp$DEcapres<-ts(data[nrow(data):1,"SWDA,MIO_EUR_CLV2005,N1111,DE"], start=c(1955,1), deltat=1/4) gdp$FRcapres<-ts(data[nrow(data):1,"SWDA,MIO_EUR_CLV2005,N1111,FR"], start=c(1955,1), deltat=1/4) gdp$UKcapres<-ts(data[nrow(data):1,"SWDA,MIO_EUR_CLV2005,N1111,UK"], start=c(1955,1), deltat=1/4) gdp$EScapres<-ts(data[nrow(data):1,"SWDA,MIO_EUR_CLV2005,N1111,ES"], start=c(1955,1), deltat=1/4) gdp$ITcapres<-ts(data[nrow(data):1,"SWDA,MIO_EUR_CLV2005,N1111,IT"], start=c(1955,1), deltat=1/4) gdp$NLcapres<-ts(data[nrow(data):1,"SWDA,MIO_EUR_CLV2005,N1111,NL"], start=c(1955,1), deltat=1/4) #Download bulk dataset from Eurostat for Government Debt rm(data) temp <- tempfile() download.file("http://epp.eurostat.ec.europa.eu/NavTree_prod/everybody/BulkDownloadListing?sort=1&file=data%2Fgov_q_ggdebt.tsv.gz",temp) data <- read.delim(gzfile(temp), header=FALSE, row.names=1, stringsAsFactors=FALSE) data<-t(data) unlink(temp) #NOTE: These variables are in NOMINAL Millions of euro (from 1.1.1999)/Millions of ECU (up to 31.12.1998) and are NOT seasonally adjusted #Government Consolidated Gross Debt rm(gov) gov<-data.frame(row.names=data[,"indic_na,sector,unit,geo\\time"]) gov$DEdebt<-ts(data[nrow(data):1,"GD,S13,MIO_EUR,DE"], start=c(2000,1), deltat=1/4) gov$FRdebt<-ts(data[nrow(data):1,"GD,S13,MIO_EUR,FR"], start=c(2000,1), deltat=1/4) gov$UKdebt<-ts(data[nrow(data):1,"GD,S13,MIO_EUR,UK"], start=c(2000,1), deltat=1/4) gov$ESdebt<-ts(data[nrow(data):1,"GD,S13,MIO_EUR,ES"], start=c(2000,1), deltat=1/4) gov$ITdebt<-ts(data[nrow(data):1,"GD,S13,MIO_EUR,IT"], start=c(2000,1), deltat=1/4) gov$NLdebt<-ts(data[nrow(data):1,"GD,S13,MIO_EUR,NL"], start=c(2000,1), deltat=1/4) #Intergovernmental lending within EU27 in the context of the financial crisis gov$DElend<-ts(data[nrow(data):1,"IGL_F4_EU27,S13,MIO_EUR,DE"], start=c(2000,1), deltat=1/4) gov$FRlend<-ts(data[nrow(data):1,"IGL_F4_EU27,S13,MIO_EUR,FR"], start=c(2000,1), deltat=1/4) gov$UKlend<-ts(data[nrow(data):1,"IGL_F4_EU27,S13,MIO_EUR,UK"], start=c(2000,1), deltat=1/4) gov$ESlend<-ts(data[nrow(data):1,"IGL_F4_EU27,S13,MIO_EUR,ES"], start=c(2000,1), deltat=1/4) gov$ITlend<-ts(data[nrow(data):1,"IGL_F4_EU27,S13,MIO_EUR,IT"], start=c(2000,1), deltat=1/4) gov$NLlend<-ts(data[nrow(data):1,"IGL_F4_EU27,S13,MIO_EUR,NL"], start=c(2000,1), deltat=1/4) #Intergovernmental lending within EU27 in the context of the financial crisis (as a % of GDP) gov$DElendper<-ts(data[nrow(data):1,"IGL_F4_EU27,S13,PC_GDP,DE"], start=c(2000,1), deltat=1/4) gov$FRlendper<-ts(data[nrow(data):1,"IGL_F4_EU27,S13,PC_GDP,FR"], start=c(2000,1), deltat=1/4) gov$UKlendper<-ts(data[nrow(data):1,"IGL_F4_EU27,S13,PC_GDP,UK"], start=c(2000,1), deltat=1/4) gov$ESlendper<-ts(data[nrow(data):1,"IGL_F4_EU27,S13,PC_GDP,ES"], start=c(2000,1), deltat=1/4) gov$ITlendper<-ts(data[nrow(data):1,"IGL_F4_EU27,S13,PC_GDP,IT"], start=c(2000,1), deltat=1/4) gov$NLlendper<-ts(data[nrow(data):1,"IGL_F4_EU27,S13,PC_GDP,NL"], start=c(2000,1), deltat=1/4) #Download bulk dataset from Eurostat for non-financial accounts for general government rm(data) temp <- tempfile() download.file("http://epp.eurostat.ec.europa.eu/NavTree_prod/everybody/BulkDownloadListing?sort=1&file=data%2Fgov_q_ggnfa.tsv.gz",temp) data <- read.delim(gzfile(temp), header=FALSE, row.names=1, stringsAsFactors=FALSE) data<-t(data) unlink(temp) #NOTE: This variable is in NOMINAL Millions of euro (from 1.1.1999)/Millions of ECU (up to 31.12.1998) and is NOT seasonally adjusted #Net lending (+) /net borrowing (-) rm(borrow) borrow<-data.frame(row.names=data[,"unit,s_adj,indic_na,geo\\time"]) borrow$DEborrow<-ts(data[nrow(data):1,"MIO_EUR,NSA,B9,DE"], start=c(1990,1), deltat=1/4) borrow$FRborrow<-ts(data[nrow(data):1,"MIO_EUR,NSA,B9,FR"], start=c(1990,1), deltat=1/4) borrow$UKborrow<-ts(data[nrow(data):1,"MIO_EUR,NSA,B9,UK"], start=c(1990,1), deltat=1/4) borrow$ESborrow<-ts(data[nrow(data):1,"MIO_EUR,NSA,B9,ES"], start=c(1990,1), deltat=1/4) borrow$ITborrow<-ts(data[nrow(data):1,"MIO_EUR,NSA,B9,IT"], start=c(1990,1), deltat=1/4) borrow$NLborrow<-ts(data[nrow(data):1,"MIO_EUR,NSA,B9,NL"], start=c(1990,1), deltat=1/4) #Net lending (+) /net borrowing (-) as a % of GDP borrow$DEbpct<-ts(data[nrow(data):1,"PC_GDP,NSA,B9,DE"], start=c(1990,1), deltat=1/4) borrow$FRbpct<-ts(data[nrow(data):1,"PC_GDP,NSA,B9,FR"], start=c(1990,1), deltat=1/4) borrow$UKbpct<-ts(data[nrow(data):1,"PC_GDP,NSA,B9,UK"], start=c(1990,1), deltat=1/4) borrow$ESbpct<-ts(data[nrow(data):1,"PC_GDP,NSA,B9,ES"], start=c(1990,1), deltat=1/4) borrow$ITbpct<-ts(data[nrow(data):1,"PC_GDP,NSA,B9,IT"], start=c(1990,1), deltat=1/4) borrow$NLbpct<-ts(data[nrow(data):1,"PC_GDP,NSA,B9,NL"], start=c(1990,1), deltat=1/4) #Download bulk dataset from Eurostat for debt-to-income ratio of households and non-financial corporations rm(data) temp <- tempfile() download.file("http://epp.eurostat.ec.europa.eu/NavTree_prod/everybody/BulkDownloadListing?sort=1&downfile=data%2Fnasa_ki.tsv.gz",temp) data <- read.delim(gzfile(temp), header=FALSE, row.names=1, stringsAsFactors=FALSE) data<-t(data) unlink(temp) #Note: These variables are in Percent of GDP #Gross Debt-to-Income Ratio of Households rm(debt) debt<-data.frame(row.names=data[,"unit,direct,indic_na,sector,geo\\time"]) debt$DEhhdebt<-ts(data[nrow(data):1,"PC,NOTSPEC,DIR_S14_S15,S14_S15,DE"], start=c(1995), deltat=1) debt$FRhhdebt<-ts(data[nrow(data):1,"PC,NOTSPEC,DIR_S14_S15,S14_S15,FR"], start=c(1995), deltat=1) debt$UKhhdebt<-ts(data[nrow(data):1,"PC,NOTSPEC,DIR_S14_S15,S14_S15,UK"], start=c(1995), deltat=1) debt$EShhdebt<-ts(data[nrow(data):1,"PC,NOTSPEC,DIR_S14_S15,S14_S15,ES"], start=c(1995), deltat=1) debt$IThhdebt<-ts(data[nrow(data):1,"PC,NOTSPEC,DIR_S14_S15,S14_S15,IT"], start=c(1995), deltat=1) debt$NLhhdebt<-ts(data[nrow(data):1,"PC,NOTSPEC,DIR_S14_S15,S14_S15,NL"], start=c(1995), deltat=1) #net debt-to-income ratio after taxes of non-financial corporations debt$DEcorpdebt<-ts(data[nrow(data):1,"PC,NOTSPEC,DIR_S11,S11,DE"], start=c(1995), deltat=1) debt$FRcorpdebt<-ts(data[nrow(data):1,"PC,NOTSPEC,DIR_S11,S11,FR"], start=c(1995), deltat=1) debt$UKcorpdebt<-ts(data[nrow(data):1,"PC,NOTSPEC,DIR_S11,S11,UK"], start=c(1995), deltat=1) debt$EScorpdebt<-ts(data[nrow(data):1,"PC,NOTSPEC,DIR_S11,S11,ES"], start=c(1995), deltat=1) debt$ITcorpdebt<-ts(data[nrow(data):1,"PC,NOTSPEC,DIR_S11,S11,IT"], start=c(1995), deltat=1) debt$NLcorpdebt<-ts(data[nrow(data):1,"PC,NOTSPEC,DIR_S11,S11,NL"], start=c(1995), deltat=1) #Download bulk dataset from Eurostat for Household Assets & Liabilities rm(data) temp <- tempfile() download.file("http://epp.eurostat.ec.europa.eu/NavTree_prod/everybody/BulkDownloadListing?sort=1&downfile=data%2Fnasa_f_bs.tsv.gz",temp) data <- read.delim(gzfile(temp), header=FALSE, row.names=1, stringsAsFactors=FALSE) data<-t(data) unlink(temp) #Note: These variables are in NOMINAL Millions of euro (from 1.1.1999)/Millions of ECU (up to 31.12.1998) #Financial Liabilities of Households rm(debt2) debt2<-data.frame(row.names=data[,"unit,co_nco,sector,finpos,indic_na,geo\\time"]) debt2$DEhhdebt2<-ts(data[nrow(data):1,"MIO_EUR,NCO,S14_S15,LIAB,F_LI,DE"], start=c(1980), deltat=1) debt2$FRhhdebt2<-ts(data[nrow(data):1,"MIO_EUR,NCO,S14_S15,LIAB,F_LI,FR"], start=c(1980), deltat=1) debt2$UKhhdebt2<-ts(data[nrow(data):1,"MIO_EUR,NCO,S14_S15,LIAB,F_LI,UK"], start=c(1980), deltat=1) debt2$EShhdebt2<-ts(data[nrow(data):1,"MIO_EUR,NCO,S14_S15,LIAB,F_LI,ES"], start=c(1980), deltat=1) debt2$IThhdebt2<-ts(data[nrow(data):1,"MIO_EUR,NCO,S14_S15,LIAB,F_LI,IT"], start=c(1980), deltat=1) debt2$NLhhdebt2<-ts(data[nrow(data):1,"MIO_EUR,NCO,S14_S15,LIAB,F_LI,NL"], start=c(1980), deltat=1) #Financial Liabilities of Non-Financial Corporations debt2$DEcorpdebt2<-ts(data[nrow(data):1,"MIO_EUR,NCO,S11,LIAB,F_LI,DE"], start=c(1980), deltat=1) debt2$FRcorpdebt2<-ts(data[nrow(data):1,"MIO_EUR,NCO,S11,LIAB,F_LI,FR"], start=c(1980), deltat=1) debt2$UKcorpdebt2<-ts(data[nrow(data):1,"MIO_EUR,NCO,S11,LIAB,F_LI,UK"], start=c(1980), deltat=1) debt2$EScorpdebt2<-ts(data[nrow(data):1,"MIO_EUR,NCO,S11,LIAB,F_LI,ES"], start=c(1980), deltat=1) debt2$ITcorpdebt2<-ts(data[nrow(data):1,"MIO_EUR,NCO,S11,LIAB,F_LI,IT"], start=c(1980), deltat=1) debt2$NLcorpdebt2<-ts(data[nrow(data):1,"MIO_EUR,NCO,S11,LIAB,F_LI,NL"], start=c(1980), deltat=1) #Loan Liabilities of Households debt2$DEhhloan<-ts(data[nrow(data):1,"MIO_EUR,NCO,S14_S15,LIAB,F4,DE"], start=c(1980), deltat=1) debt2$FRhhloan<-ts(data[nrow(data):1,"MIO_EUR,NCO,S14_S15,LIAB,F4,FR"], start=c(1980), deltat=1) debt2$UKhhloan<-ts(data[nrow(data):1,"MIO_EUR,NCO,S14_S15,LIAB,F4,UK"], start=c(1980), deltat=1) debt2$EShhloan<-ts(data[nrow(data):1,"MIO_EUR,NCO,S14_S15,LIAB,F4,ES"], start=c(1980), deltat=1) debt2$IThhloan<-ts(data[nrow(data):1,"MIO_EUR,NCO,S14_S15,LIAB,F4,IT"], start=c(1980), deltat=1) debt2$NLhhloan<-ts(data[nrow(data):1,"MIO_EUR,NCO,S14_S15,LIAB,F4,NL"], start=c(1980), deltat=1) #Loan Liabilities of Non-Financial Corporations debt2$DEcorploan<-ts(data[nrow(data):1,"MIO_EUR,NCO,S11,LIAB,F4,DE"], start=c(1980), deltat=1) debt2$FRcorploan<-ts(data[nrow(data):1,"MIO_EUR,NCO,S11,LIAB,F4,FR"], start=c(1980), deltat=1) debt2$UKcorploan<-ts(data[nrow(data):1,"MIO_EUR,NCO,S11,LIAB,F4,UK"], start=c(1980), deltat=1) debt2$EScorploan<-ts(data[nrow(data):1,"MIO_EUR,NCO,S11,LIAB,F4,ES"], start=c(1980), deltat=1) debt2$ITcorploan<-ts(data[nrow(data):1,"MIO_EUR,NCO,S11,LIAB,F4,IT"], start=c(1980), deltat=1) debt2$NLcorploan<-ts(data[nrow(data):1,"MIO_EUR,NCO,S11,LIAB,F4,NL"], start=c(1980), deltat=1) #Long-term Loan Liabilities of Households debt2$DEhhloanl<-ts(data[nrow(data):1,"MIO_EUR,NCO,S14_S15,LIAB,F42,DE"], start=c(1980), deltat=1) debt2$FRhhloanl<-ts(data[nrow(data):1,"MIO_EUR,NCO,S14_S15,LIAB,F42,FR"], start=c(1980), deltat=1) debt2$UKhhloanl<-ts(data[nrow(data):1,"MIO_EUR,NCO,S14_S15,LIAB,F42,UK"], start=c(1980), deltat=1) debt2$EShhloanl<-ts(data[nrow(data):1,"MIO_EUR,NCO,S14_S15,LIAB,F42,ES"], start=c(1980), deltat=1) debt2$IThhloanl<-ts(data[nrow(data):1,"MIO_EUR,NCO,S14_S15,LIAB,F42,IT"], start=c(1980), deltat=1) debt2$NLhhloanl<-ts(data[nrow(data):1,"MIO_EUR,NCO,S14_S15,LIAB,F42,NL"], start=c(1980), deltat=1) #Long-term Loan Liabilities of Non-Financial Corporations debt2$DEcorploanl<-ts(data[nrow(data):1,"MIO_EUR,NCO,S11,LIAB,F42,DE"], start=c(1980), deltat=1) debt2$FRcorploanl<-ts(data[nrow(data):1,"MIO_EUR,NCO,S11,LIAB,F42,FR"], start=c(1980), deltat=1) debt2$UKcorploanl<-ts(data[nrow(data):1,"MIO_EUR,NCO,S11,LIAB,F42,UK"], start=c(1980), deltat=1) debt2$EScorploanl<-ts(data[nrow(data):1,"MIO_EUR,NCO,S11,LIAB,F42,ES"], start=c(1980), deltat=1) debt2$ITcorploanl<-ts(data[nrow(data):1,"MIO_EUR,NCO,S11,LIAB,F42,IT"], start=c(1980), deltat=1) debt2$NLcorploanl<-ts(data[nrow(data):1,"MIO_EUR,NCO,S11,LIAB,F42,NL"], start=c(1980), deltat=1) #Short-term Loan Liabilities of Households debt2$DEhhloans<-ts(data[nrow(data):1,"MIO_EUR,NCO,S14_S15,LIAB,F41,DE"], start=c(1980), deltat=1) debt2$FRhhloans<-ts(data[nrow(data):1,"MIO_EUR,NCO,S14_S15,LIAB,F41,FR"], start=c(1980), deltat=1) debt2$UKhhloans<-ts(data[nrow(data):1,"MIO_EUR,NCO,S14_S15,LIAB,F41,UK"], start=c(1980), deltat=1) debt2$EShhloans<-ts(data[nrow(data):1,"MIO_EUR,NCO,S14_S15,LIAB,F41,ES"], start=c(1980), deltat=1) debt2$IThhloans<-ts(data[nrow(data):1,"MIO_EUR,NCO,S14_S15,LIAB,F41,IT"], start=c(1980), deltat=1) debt2$NLhhloans<-ts(data[nrow(data):1,"MIO_EUR,NCO,S14_S15,LIAB,F41,NL"], start=c(1980), deltat=1) #Short-term Loan Liabilities of Non-Financial Corporations debt2$DEcorploans<-ts(data[nrow(data):1,"MIO_EUR,NCO,S11,LIAB,F41,DE"], start=c(1980), deltat=1) debt2$FRcorploans<-ts(data[nrow(data):1,"MIO_EUR,NCO,S11,LIAB,F41,FR"], start=c(1980), deltat=1) debt2$UKcorploans<-ts(data[nrow(data):1,"MIO_EUR,NCO,S11,LIAB,F41,UK"], start=c(1980), deltat=1) debt2$EScorploans<-ts(data[nrow(data):1,"MIO_EUR,NCO,S11,LIAB,F41,ES"], start=c(1980), deltat=1) debt2$ITcorploans<-ts(data[nrow(data):1,"MIO_EUR,NCO,S11,LIAB,F41,IT"], start=c(1980), deltat=1) debt2$NLcorploans<-ts(data[nrow(data):1,"MIO_EUR,NCO,S11,LIAB,F41,NL"], start=c(1980), deltat=1) ############################################################### #Compute government spending as a % of GDP rm(data) data<-as.numeric(gdp$DEgov)/as.numeric(gdp$DEreal) gdp$DEgpct<-ts(data, start=c(1955,1),deltat=1/4) rm(data) data<-as.numeric(gdp$FRgov)/as.numeric(gdp$FRreal) gdp$FRgpct<-ts(data, start=c(1955,1),deltat=1/4) rm(data) data<-as.numeric(gdp$UKgov)/as.numeric(gdp$UKreal) gdp$UKgpct<-ts(data, start=c(1955,1),deltat=1/4) rm(data) data<-as.numeric(gdp$ESgov)/as.numeric(gdp$ESreal) gdp$ESgpct<-ts(data, start=c(1955,1),deltat=1/4) rm(data) data<-as.numeric(gdp$ITgov)/as.numeric(gdp$ITreal) gdp$ITgpct<-ts(data, start=c(1955,1),deltat=1/4) rm(data) data<-as.numeric(gdp$NLgov)/as.numeric(gdp$NLreal) gdp$NLgpct<-ts(data, start=c(1955,1),deltat=1/4) data<-as.numeric(gdp$USgov)/as.numeric(gdp$USreal) gdp$USgpct<-ts(data, start=c(1955,1),deltat=1/4) ############################################################### #Compute change from previous peak attach(gdp, pos=2) n <- dim(gdp)[2] for(i in 1:n){ name <- paste(colnames(gdp)[i],"08",sep=".") assn <- as.numeric(window(get(colnames(gdp)[i]),start=c(2008,1),end=NULL)) assign(name, ts((assn/assn[1] -1)*100, start=1)) } detach(gdp, pos=2) attach(gov, pos=2) n <- dim(gov)[2] for(i in 1:n){ name <- paste(colnames(gov)[i],"08",sep=".") assn <- as.numeric(window(get(colnames(gov)[i]),start=c(2008,1),end=NULL)) assign(name, ts((assn/assn[1] -1)*100, start=1)) } detach(gov, pos=2) attach(borrow, pos=2) n <- dim(borrow)[2] for(i in 1:n){ name <- paste(colnames(borrow)[i],"08",sep=".") assn <- as.numeric(window(get(colnames(borrow)[i]),start=c(2008,1),end=NULL)) assign(name, ts((assn/assn[1] -1)*100, start=1)) } detach(borrow, pos=2) attach(debt2, pos=2) n <- dim(debt2)[2] for(i in 1:n){ name <- paste(colnames(debt2)[i],"08",sep=".") assn <- as.numeric(window(get(colnames(debt2)[i]),start=c(2008),end=NULL)) assign(name, ts((assn/assn[1] -1)*100, start=0)) } detach(debt2, pos=2) #For gov, debt, and borrow (% of GDP) only, compute absolute change from peak name <- paste("DEgpctA","08", sep=".") assn <- as.numeric(window(gdp$DEgpct,start=c(2008,1),end=NULL)) assign(name, ts((assn-assn[1])*100, start=1)) name <- paste("FRgpctA","08", sep=".") assn <- as.numeric(window(gdp$FRgpct,start=c(2008,1),end=NULL)) assign(name, ts((assn-assn[1])*100, start=1)) name <- paste("UKgpctA","08", sep=".") assn <- as.numeric(window(gdp$UKgpct,start=c(2008,1),end=NULL)) assign(name, ts((assn-assn[1])*100, start=1)) name <- paste("ESgpctA","08", sep=".") assn <- as.numeric(window(gdp$ESgpct,start=c(2008,1),end=NULL)) assign(name, ts((assn-assn[1])*100, start=1)) name <- paste("ITgpctA","08", sep=".") assn <- as.numeric(window(gdp$ITgpct,start=c(2008,1),end=NULL)) assign(name, ts((assn-assn[1])*100, start=1)) name <- paste("NLgpctA","08", sep=".") assn <- as.numeric(window(gdp$NLgpct,start=c(2008,1),end=NULL)) assign(name, ts((assn-assn[1])*100, start=1)) name <- paste("USgpctA","08", sep=".") assn <- as.numeric(window(gdp$USgpct,start=c(2008,1),end=NULL)) assign(name, ts((assn-assn[1])*100, start=1)) name <- paste("DEbpctA","08", sep=".") assn <- as.numeric(window(borrow$DEbpct,start=c(2008,1),end=NULL)) assign(name, ts((assn-assn[1])*100, start=1)) name <- paste("FRbpctA","08", sep=".") assn <- as.numeric(window(borrow$FRbpct,start=c(2008,1),end=NULL)) assign(name, ts((assn-assn[1])*100, start=1)) name <- paste("UKbpctA","08", sep=".") assn <- as.numeric(window(borrow$UKbpct,start=c(2008,1),end=NULL)) assign(name, ts((assn-assn[1])*100, start=1)) name <- paste("ESbpctA","08", sep=".") assn <- as.numeric(window(borrow$ESbpct,start=c(2008,1),end=NULL)) assign(name, ts((assn-assn[1])*100, start=1)) name <- paste("ITbpctA","08", sep=".") assn <- as.numeric(window(borrow$ITbpct,start=c(2008,1),end=NULL)) assign(name, ts((assn-assn[1])*100, start=1)) name <- paste("NLbpctA","08", sep=".") assn <- as.numeric(window(borrow$NLbpct,start=c(2008,1),end=NULL)) assign(name, ts((assn-assn[1])*100, start=1)) attach(debt, pos=2) n <- dim(debt)[2] for(i in 1:n){ name <- paste(colnames(debt)[i],"08",sep=".") assn <- as.numeric(window(get(colnames(debt)[i]),start=c(2008),end=NULL)) assign(name, ts((assn-assn[1]), start=0)) } detach(debt, pos=2) #Percentage change from trough (Real GDP only) UK.trough.08 <- as.numeric(window(gdp$UKreal, start=c(2009,2),end=NULL)) UK.trough.08 <- ts((UK.trough.08/UK.trough.08[1] - 1)*100, start=1) FR.trough.08 <- as.numeric(window(gdp$FRreal, start=c(2009,2),end=NULL)) FR.trough.08 <- ts((FR.trough.08/FR.trough.08[1] - 1)*100, start=1) IT.trough.08 <- as.numeric(window(gdp$ITreal, start=c(2009,2),end=NULL)) IT.trough.08 <- ts((IT.trough.08/IT.trough.08[1] - 1)*100, start=1) DE.trough.08 <- as.numeric(window(gdp$DEreal, start=c(2009,2),end=NULL)) DE.trough.08 <- ts((DE.trough.08/DE.trough.08[1] - 1)*100, start=1) ES.trough.08 <- as.numeric(window(gdp$ESreal, start=c(2009,2),end=NULL)) ES.trough.08 <- ts((ES.trough.08/ES.trough.08[1] - 1)*100, start=1) NL.trough.08 <- as.numeric(window(gdp$NLreal, start=c(2009,2),end=NULL)) NL.trough.08 <- ts((NL.trough.08/NL.trough.08[1] - 1)*100, start=1) ############################################################### #Graph Series x11() #pdf(paste("ALL-current_cycle-",Sys.Date(),".pdf",sep=""),onefile=TRUE,family="Times", pointsize=12,width=9.33,height=7) #Real GDP plot(gdp$DEreal, main="Real Gross Domestic Product", ylim=c(min(as.numeric(gdp$ESreal), as.numeric(gdp$ITreal), as.numeric(gdp$UKreal), as.numeric(gdp$DEreal), as.numeric(gdp$FRreal), as.numeric(gdp$NLreal), na.rm=TRUE)-1,max(as.numeric(gdp$ESreal), as.numeric(gdp$ITreal), as.numeric(gdp$UKreal), as.numeric(gdp$DEreal), as.numeric(gdp$FRreal), as.numeric(gdp$NLreal), na.rm=TRUE)+1), ylab="Millions of 2005 Chain-linked Euro", xlab="Year", col="white", type="l", lwd=2, axes=FALSE, xaxs="i", yaxt="n", tck=1, bty="l", family="Times") axis(2, tick=TRUE, tck=1, lwd.ticks=.1, col.ticks="grey", at=axTicks(2), labels=(sprintf("%1.f", axTicks(2))) ) axis(1, tick=TRUE, las=1, ) abline(h=0) lines(gdp$DEreal,col="darkgreen",lwd=2) lines(gdp$FRreal,col="orange3",lwd=2) lines(gdp$UKreal,col="red",lwd=2) lines(gdp$ESreal,col="orangered4",lwd=2) lines(gdp$ITreal,col="aquamarine4", lwd=2) lines(gdp$NLreal,col="purple4", lwd=2) mtext("Seasonally Adjusted", side = 3, line=0.5, cex = 1) mtext("Cooley-Rupert European Economic Snapshot; www.europeansnapshot.com", side = 4, line= 0, cex = .7, adj = 0) mtext("Source: Eurostat", side = 4, line= 1, cex = .7, adj = 0) box() legend("topleft", c("Germany","France","United Kingdom","Spain", "Italy", "Netherlands"), col=c("darkgreen","orange3","red","orangered4", "aquamarine4", "purple4"), lwd=c(2,2,2,2,2,2), lty=c(1,1,1,1,1,1), inset=.02, cex=.75, bg="gray87") dev.copy2pdf(file=paste("ALL-rgdp-",Sys.Date(),".pdf", sep=""), pointsize=12, width=8, height=6) #setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),"/pdf_presentation",sep"")) #dev.copy2pdf(file=paste("ALL-rgdp-",Sys.Date(),"-presentation.pdf", sep=""), family="Times", pointsize=12, height = 7, width = 10) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),"/png",sep="")) dev.print(png, file=paste("ALL-rgdp-",Sys.Date(),".png", sep=""), pointsize = 12, width=8, height=6, bg = "white", res=400, units="in") setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),sep="")) ############################################################### #Real GDP - Change from Peak plot(UKreal.08, main="Real Gross Domestic Product", ylab="", xlab="Quarters from 2008 peak", col="white", type="l", lwd=2, axes=FALSE, yaxs="i", xaxs="i", tck=1, bty="l", family="Times", ylim=c(min(as.numeric(ESreal.08), as.numeric(ITreal.08), as.numeric(UKreal.08), as.numeric(DEreal.08), as.numeric(FRreal.08), as.numeric(NLreal.08), na.rm=TRUE)-1,max(as.numeric(ESreal.08), as.numeric(ITreal.08), as.numeric(UKreal.08), as.numeric(DEreal.08), as.numeric(FRreal.08), as.numeric(NLreal.08), na.rm=TRUE)+1)) axis(2, tick=TRUE, tck=1, lwd.ticks=.1, col.ticks="grey") axis(1, tick=TRUE, las=1, at=c(seq(0,35,4))) abline(h=0) lines(DEreal.08,col="darkgreen",lwd=2) lines(FRreal.08,col="orange3",lwd=2) lines(UKreal.08,col="red",lwd=2) lines(ESreal.08,col="orangered4",lwd=2) lines(ITreal.08,col="aquamarine4", lwd=2) lines(NLreal.08,col="purple4", lwd=2) box() legend("topleft", c("Germany","France","United Kingdom","Spain", "Italy", "Netherlands"), col=c("darkgreen","orange3","red","orangered4", "aquamarine4", "purple4"), lwd=c(2,2,2,2,2,2), lty=c(1,1,1,1,1,1), inset=.02, cex=.75, bg="gray87") mtext("Percentage change from 2008 peak, Seasonally Adjusted", side = 3, line=0.5, cex = 1) mtext("Cooley-Rupert European Economic Snapshot; www.europeansnapshot.com", side = 4, line= 0, cex = .7, adj = 0) mtext("Source: Eurostat", side = 4, line= 1, cex = .7, adj = 0) dev.copy2pdf(file=paste("ALL-rgdpch-",Sys.Date(),".pdf", sep=""), width=8, height=6, pointsize=12) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),"/png",sep="")) dev.print(png, file=paste("ALL-rgdpch-",Sys.Date(),".png", sep=""), pointsize = 12, width = 8, height = 6, bg = "white", units="in", res=400) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),sep="")) ############################################################### #Real GDP - Change from Peak - with US plot(UKreal.08, main="Real Gross Domestic Product", ylab="", xlab="Quarters from 2008 peak", col="white", type="l", lwd=2, axes=FALSE, yaxs="i", xaxs="i", tck=1, bty="l", family="Times", ylim=c(min(as.numeric(ESreal.08), as.numeric(ITreal.08), as.numeric(UKreal.08), as.numeric(DEreal.08), as.numeric(FRreal.08), as.numeric(NLreal.08), as.numeric(USreal.08), na.rm=TRUE)-1,max(as.numeric(ESreal.08), as.numeric(ITreal.08), as.numeric(UKreal.08), as.numeric(DEreal.08), as.numeric(FRreal.08), as.numeric(NLreal.08), as.numeric(USreal.08), na.rm=TRUE)+1)) axis(2, tick=TRUE, tck=1, lwd.ticks=.1, col.ticks="grey") axis(1, tick=TRUE, las=1, at=c(seq(0,35,4))) abline(h=0) lines(DEreal.08,col="darkgreen",lwd=2) lines(FRreal.08,col="orange3",lwd=2) lines(UKreal.08,col="red",lwd=2) lines(ESreal.08,col="orangered4",lwd=2) lines(ITreal.08,col="aquamarine4", lwd=2) lines(NLreal.08,col="purple4", lwd=2) lines(USreal.08,col="mediumblue", lwd=4) box() legend("topleft", c("Germany","France","United Kingdom","Spain", "Italy", "Netherlands", "United States"), col=c("darkgreen","orange3","red","orangered4", "aquamarine4", "purple4","mediumblue"), lwd=c(2,2,2,2,2,2,2), lty=c(1,1,1,1,1,1,1), inset=.02, cex=.75, bg="gray87") mtext("Percentage change from 2008 peak, Seasonally Adjusted", side = 3, line=0.5, cex = 1) mtext("Cooley-Rupert European Economic Snapshot; www.europeansnapshot.com", side = 4, line= 0, cex = .7, adj = 0) mtext("Source: Eurostat", side = 4, line= 1, cex = .7, adj = 0) dev.copy2pdf(file=paste("US-EU-rgdpch-",Sys.Date(),".pdf", sep=""),pointsize=12,width=8, height=6) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),"/png",sep="")) dev.print(png, file=paste("US-EU-rgdpch-",Sys.Date(),".png", sep=""), pointsize = 12, width = 8, height = 6, units="in", bg = "white", res=400) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),sep="")) ############################################################### #Real GDP from Trough plot(UK.trough.08, main="Real Gross Domestic Product", ylab="", xlab="Quarters from 2009 trough", col="white", type="l", lwd=2, axes=FALSE, yaxs="i", xaxs="i", tck=1, bty="l", family="Times", ylim=c(min(as.numeric(ES.trough.08), as.numeric(IT.trough.08), as.numeric(UK.trough.08), as.numeric(DE.trough.08), as.numeric(FR.trough.08), as.numeric(NL.trough.08), na.rm=TRUE)-1,max(as.numeric(ES.trough.08), as.numeric(IT.trough.08), as.numeric(UK.trough.08), as.numeric(DE.trough.08), as.numeric(FR.trough.08), as.numeric(NL.trough.08), na.rm=TRUE)+1)) axis(2, tick=TRUE, tck=1, lwd.ticks=.1, col.ticks="grey") axis(1, tick=TRUE, las=1, at=c(seq(0,35,4))) abline(h=0) lines(DE.trough.08,col="darkgreen",lwd=2) lines(FR.trough.08,col="orange3",lwd=2) lines(UK.trough.08,col="red",lwd=2) lines(ES.trough.08,col="orangered4",lwd=2) lines(IT.trough.08,col="aquamarine4", lwd=2) lines(NL.trough.08, col="purple4", lwd=2) box() legend("topleft", c("Germany","France","United Kingdom","Spain", "Italy", "Netherlands"), col=c("darkgreen","orange3","red","orangered4", "aquamarine4", "purple4"), lwd=c(2,2,2,2,2,2), lty=c(1,1,1,1,1,1), inset=.02, cex=.75, bg="gray87") mtext("Percentage change from 2009 trough, Seasonally Adjusted", side = 3, line=0.5, cex = 1) mtext("Cooley-Rupert European Economic Snapshot; www.europeansnapshot.com", side = 4, line= 0, cex = .7, adj = 0) mtext("Source: Eurostat", side = 4, line= 1, cex = .7, adj = 0) dev.copy2pdf(file=paste("ALL-gdp_trough-",Sys.Date(),".pdf", sep=""), width=8, height=6, pointsize=12) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),"/png",sep="")) dev.print(png, file=paste("ALL-gdp_trough-",Sys.Date(),".png", sep=""), pointsize=12, width=8, height=6, units="in", bg="white", res=400) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),sep="")) ############################################################### #Real Private Final Consumption Expenditures - Change from Peak plot(UKcons.08, main="Real Private Final Consumption Expenditures", ylab="", xlab="Quarters from 2008 peak", col="white", type="l", lwd=2, axes=FALSE, yaxs="i", xaxs="i", tck=1, bty="l", family="Times", ylim=c(min(as.numeric(EScons.08), as.numeric(ITcons.08), as.numeric(UKcons.08), as.numeric(DEcons.08), as.numeric(FRcons.08), as.numeric(NLcons.08), na.rm=TRUE)-1,max(as.numeric(EScons.08), as.numeric(ITcons.08), as.numeric(UKcons.08), as.numeric(DEcons.08), as.numeric(FRcons.08), as.numeric(NLcons.08), na.rm=TRUE)+1)) axis(2, tick=TRUE, tck=1, lwd.ticks=.1, col.ticks="grey") axis(1, tick=TRUE, las=1, at=c(seq(0,35,4))) abline(h=0) lines(DEcons.08,col="darkgreen",lwd=2) lines(FRcons.08,col="orange3",lwd=2) lines(UKcons.08,col="red",lwd=2) lines(EScons.08,col="orangered4",lwd=2) lines(ITcons.08,col="aquamarine4", lwd=2) lines(NLcons.08, col="purple4", lwd=2) box() legend("topleft", c("Germany","France","United Kingdom","Spain", "Italy", "Netherlands"), col=c("darkgreen","orange3","red","orangered4", "aquamarine4", "purple4"), lwd=c(2,2,2,2,2,2), lty=c(1,1,1,1,1,1), inset=.02, cex=.75, bg="gray87") mtext("Percentage change from 2008 peak, Seasonally Adjusted", side = 3, line=0.5, cex = 1) mtext("Cooley-Rupert European Economic Snapshot; www.europeansnapshot.com", side = 4, line= 0, cex = .7, adj = 0) mtext("Source: Eurostat", side = 4, line= 1, cex = .7, adj = 0) dev.copy2pdf(file=paste("ALL-rconsch-",Sys.Date(),".pdf", sep=""), width=8, height=6, pointsize=12) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),"/png",sep="")) dev.print(png, file=paste("ALL-rconsch-",Sys.Date(),".png", sep=""), pointsize=12, width=8, height=6, units="in", bg="white", res=400) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),sep="")) ############################################################### #Real Private Final Consumption Expenditures - Change from Peak - with US plot(UKcons.08, main="Real Private Final Consumption Expenditures", ylab="", xlab="Quarters from 2008 peak", col="white", type="l", lwd=2, axes=FALSE, yaxs="i", xaxs="i", tck=1, bty="l", family="Times", ylim=c(min(as.numeric(EScons.08), as.numeric(ITcons.08), as.numeric(UKcons.08), as.numeric(DEcons.08), as.numeric(FRcons.08), as.numeric(NLcons.08),as.numeric(UScons.08), na.rm=TRUE)-1,max(as.numeric(EScons.08), as.numeric(ITcons.08), as.numeric(UKcons.08), as.numeric(DEcons.08), as.numeric(FRcons.08), as.numeric(NLcons.08),as.numeric(UScons.08), na.rm=TRUE)+1)) axis(2, tick=TRUE, tck=1, lwd.ticks=.1, col.ticks="grey") axis(1, tick=TRUE, las=1, at=c(seq(0,35,4))) abline(h=0) lines(DEcons.08,col="darkgreen",lwd=2) lines(FRcons.08,col="orange3",lwd=2) lines(UKcons.08,col="red",lwd=2) lines(EScons.08,col="orangered4",lwd=2) lines(ITcons.08,col="aquamarine4", lwd=2) lines(NLcons.08, col="purple4", lwd=2) lines(UScons.08, col="mediumblue", lwd=4) box() legend("topleft", c("Germany","France","United Kingdom","Spain", "Italy", "Netherlands", "United States"), col=c("darkgreen","orange3","red","orangered4", "aquamarine4", "purple4","mediumblue"), lwd=c(2,2,2,2,2,2,2), lty=c(1,1,1,1,1,1,1), inset=.02, cex=.75, bg="gray87") mtext("Percentage change from 2008 peak, Seasonally Adjusted", side = 3, line=0.5, cex = 1) mtext("Cooley-Rupert European Economic Snapshot; www.europeansnapshot.com", side = 4, line= 0, cex = .7, adj = 0) mtext("Source: Eurostat", side = 4, line= 1, cex = .7, adj = 0) dev.copy2pdf(file=paste("US-EU-rconsch-",Sys.Date(),".pdf", sep=""), width=8, height=6, pointsize=12) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),"/png",sep="")) dev.print(png, file=paste("US-EU-rconsch-",Sys.Date(),".png", sep=""), pointsize=12, width=8, height=6, units="in", bg="white", res=400) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),sep="")) ############################################################### #Real Gross Capital Formation - Change from Peak plot(UKcapf.08, main="Real Gross Capital Formation", ylab="", xlab="Quarters from 2008 peak", col="white", type="l", lwd=2, axes=FALSE, yaxs="i", xaxs="i", tck=1, bty="l", family="Times", ylim=c(min(as.numeric(EScapf.08), as.numeric(ITcapf.08), as.numeric(UKcapf.08), as.numeric(DEcapf.08), as.numeric(FRcapf.08), as.numeric(NLcapf.08), na.rm=TRUE)-1,max(as.numeric(EScapf.08), as.numeric(ITcapf.08), as.numeric(UKcapf.08), as.numeric(DEcapf.08), as.numeric(FRcapf.08), as.numeric(NLcapf.08), na.rm=TRUE)+1)) axis(2, tick=TRUE, tck=1, lwd.ticks=.1, col.ticks="grey") axis(1, tick=TRUE, las=1, at=c(seq(0,35,4))) abline(h=0) lines(DEcapf.08,col="darkgreen",lwd=2) lines(FRcapf.08,col="orange3",lwd=2) lines(UKcapf.08,col="red",lwd=2) lines(EScapf.08,col="orangered4",lwd=2) lines(ITcapf.08,col="aquamarine4", lwd=2) lines(NLcapf.08, col="purple4", lwd=2) box() legend("topleft", c("Germany","France","United Kingdom","Spain", "Italy", "Netherlands"), col=c("darkgreen","orange3","red","orangered4", "aquamarine4", "purple4"), lwd=c(2,2,2,2,2,2), lty=c(1,1,1,1,1,1), inset=.02, cex=.75, bg="gray87") mtext("Percentage change from 2008 peak, Seasonally Adjusted", side = 3, line=0.5, cex = 1) mtext("Cooley-Rupert European Economic Snapshot; www.europeansnapshot.com", side = 4, line= 0, cex = .7, adj = 0) mtext("Source: Eurostat", side = 4, line= 1, cex = .7, adj = 0) dev.copy2pdf(file=paste("ALL-rcapch-",Sys.Date(),".pdf", sep=""), width=8, height=6, pointsize=12) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),"/png",sep="")) dev.print(png, file=paste("ALL-rcapch-",Sys.Date(),".png", sep=""), pointsize=12, width=8, height=6, units="in", bg="white", res=400) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),sep="")) ############################################################### #Real Gross Capital Formation - Change from Peak - with US plot(UKcapf.08, main="Real Gross Capital Formation", ylab="", xlab="Quarters from 2008 peak", col="white", type="l", lwd=2, axes=FALSE, yaxs="i", xaxs="i", tck=1, bty="l", family="Times", ylim=c(min(as.numeric(EScapf.08), as.numeric(ITcapf.08), as.numeric(UKcapf.08), as.numeric(DEcapf.08), as.numeric(FRcapf.08), as.numeric(NLcapf.08),as.numeric(UScapf.08), na.rm=TRUE)-1,max(as.numeric(EScapf.08), as.numeric(ITcapf.08), as.numeric(UKcapf.08), as.numeric(DEcapf.08), as.numeric(FRcapf.08), as.numeric(NLcapf.08),as.numeric(UScapf.08), na.rm=TRUE)+1)) axis(2, tick=TRUE, tck=1, lwd.ticks=.1, col.ticks="grey") axis(1, tick=TRUE, las=1, at=c(seq(0,35,4))) abline(h=0) lines(DEcapf.08,col="darkgreen",lwd=2) lines(FRcapf.08,col="orange3",lwd=2) lines(UKcapf.08,col="red",lwd=2) lines(EScapf.08,col="orangered4",lwd=2) lines(ITcapf.08,col="aquamarine4", lwd=2) lines(NLcapf.08, col="purple4", lwd=2) lines(UScapf.08, col="mediumblue", lwd=4) box() legend("topleft", c("Germany","France","United Kingdom","Spain", "Italy", "Netherlands", "United States"), col=c("darkgreen","orange3","red","orangered4", "aquamarine4", "purple4","mediumblue"), lwd=c(2,2,2,2,2,2,2), lty=c(1,1,1,1,1,1,1), inset=.02, cex=.75, bg="gray87") mtext("Percentage change from 2008 peak, Seasonally Adjusted", side = 3, line=0.5, cex = 1) mtext("Cooley-Rupert European Economic Snapshot; www.europeansnapshot.com", side = 4, line= 0, cex = .7, adj = 0) mtext("Source: Eurostat", side = 4, line= 1, cex = .7, adj = 0) dev.copy2pdf(file=paste("US-EU-rcapch-",Sys.Date(),".pdf", sep=""), width=8, height=6, pointsize=12) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),"/png",sep="")) dev.print(png, file=paste("US-EU-rcapch-",Sys.Date(),".png", sep=""), pointsize=12, width=8, height=6, units="in", bg="white", res=400) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),sep="")) ############################################################### #Real Private Consmption Expenditures and Gross Capital Formation - Change from Peak - with US plot(UKconsinv.08, main="Real Consumption Expenditures and Gross Capital Formation", ylab="", xlab="Quarters from 2008 peak", col="white", type="l", lwd=2, axes=FALSE, yaxs="i", xaxs="i", tck=1, bty="l", family="Times", ylim=c(min(as.numeric(ESconsinv.08), as.numeric(ITconsinv.08), as.numeric(UKconsinv.08), as.numeric(DEconsinv.08), as.numeric(FRconsinv.08), as.numeric(NLconsinv.08),as.numeric(USconsinv.08), na.rm=TRUE)-1,max(as.numeric(ESconsinv.08), as.numeric(ITconsinv.08), as.numeric(UKconsinv.08), as.numeric(DEconsinv.08), as.numeric(FRconsinv.08), as.numeric(NLconsinv.08),as.numeric(USconsinv.08), na.rm=TRUE)+1)) axis(2, tick=TRUE, tck=1, lwd.ticks=.1, col.ticks="grey") axis(1, tick=TRUE, las=1, at=c(seq(0,35,4))) abline(h=0) lines(DEconsinv.08,col="darkgreen",lwd=2) lines(FRconsinv.08,col="orange3",lwd=2) lines(UKconsinv.08,col="red",lwd=2) lines(ESconsinv.08,col="orangered4",lwd=2) lines(ITconsinv.08,col="aquamarine4", lwd=2) lines(NLconsinv.08, col="purple4", lwd=2) lines(USconsinv.08, col="mediumblue", lwd=4) box() legend("bottomleft", c("Germany","France","United Kingdom","Spain", "Italy", "Netherlands", "United States"), col=c("darkgreen","orange3","red","orangered4", "aquamarine4", "purple4","mediumblue"), lwd=c(2,2,2,2,2,2,2), lty=c(1,1,1,1,1,1,1), inset=.02, cex=.75, bg="gray87") mtext("Percentage change from 2008 peak, Seasonally Adjusted", side = 3, line=0.5, cex = 1) mtext("Cooley-Rupert European Economic Snapshot; www.europeansnapshot.com", side = 4, line= 0, cex = .7, adj = 0) mtext("Source: Eurostat", side = 4, line= 1, cex = .7, adj = 0) dev.copy2pdf(file=paste("US-EU-consinv-",Sys.Date(),".pdf", sep=""), width=8, height=6, pointsize=12) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),"/png",sep="")) dev.print(png, file=paste("US-EU-consinv-",Sys.Date(),".png", sep=""), pointsize=12, width=8, height=6, units="in", bg="white", res=400) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),sep="")) ############################################################### #Real Residential Fixed Capital Formation - Change from Peak plot(UKcapres.08, main="Real Residential Fixed Capital Formation", ylab="", xlab="Quarters from 2008 peak", col="white", type="l", lwd=2, axes=FALSE, yaxs="i", xaxs="i", tck=1, bty="l", family="Times", ylim=c(min(as.numeric(EScapres.08), as.numeric(ITcapres.08), as.numeric(UKcapres.08), as.numeric(DEcapres.08), as.numeric(FRcapres.08), as.numeric(NLcapres.08), na.rm=TRUE)-1,max(as.numeric(EScapres.08), as.numeric(ITcapres.08), as.numeric(UKcapres.08), as.numeric(DEcapres.08), as.numeric(FRcapres.08), as.numeric(NLcapres.08), na.rm=TRUE)+1)) axis(2, tick=TRUE, tck=1, lwd.ticks=.1, col.ticks="grey") axis(1, tick=TRUE, las=1, at=c(seq(0,35,4))) abline(h=0) lines(DEcapres.08,col="darkgreen",lwd=2) lines(FRcapres.08,col="orange3",lwd=2) lines(UKcapres.08,col="red",lwd=2) lines(EScapres.08,col="orangered4",lwd=2) lines(ITcapres.08,col="aquamarine4", lwd=2) lines(NLcapres.08, col="purple4", lwd=2) box() legend("topleft", c("Germany","France","United Kingdom","Spain", "Italy", "Netherlands"), col=c("darkgreen","orange3","red","orangered4", "aquamarine4", "purple4"), lwd=c(2,2,2,2,2,2), lty=c(1,1,1,1,1,1), inset=.02, cex=.75, bg="gray87") mtext("Percentage change from 2008 peak, Seasonally Adjusted", side = 3, line=0.5, cex = 1) mtext("Cooley-Rupert European Economic Snapshot; www.europeansnapshot.com", side = 4, line= 0, cex = .7, adj = 0) mtext("Source: Eurostat", side = 4, line= 1, cex = .7, adj = 0) dev.copy2pdf(file=paste("ALL-capresch-",Sys.Date(),".pdf", sep=""), width=8, height=6, pointsize=12) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),"/png",sep="")) dev.print(png, file=paste("ALL-rcapresch-",Sys.Date(),".png", sep=""), pointsize=12, width=8, height=6, units="in", bg="white", res=400) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),sep="")) ############################################################### #Real Final Consumption Expenditures of Government - Change from Peak plot(UKgov.08, main="Real Final Consumption Expenditures of Government", ylab="", xlab="Quarters from 2008 peak", col="white", type="l", lwd=2, axes=FALSE, yaxs="i", xaxs="i", tck=1, bty="l", family="Times", ylim=c(min(as.numeric(ESgov.08), as.numeric(ITgov.08), as.numeric(UKgov.08), as.numeric(DEgov.08), as.numeric(FRgov.08), as.numeric(NLgov.08), na.rm=TRUE)-1,max(as.numeric(ESgov.08), as.numeric(ITgov.08), as.numeric(UKgov.08), as.numeric(DEgov.08), as.numeric(FRgov.08), as.numeric(NLgov.08), na.rm=TRUE)+1)) axis(2, tick=TRUE, tck=1, lwd.ticks=.1, col.ticks="grey") axis(1, tick=TRUE, las=1, at=c(seq(0,35,4))) abline(h=0) lines(DEgov.08,col="darkgreen",lwd=2) lines(FRgov.08,col="orange3",lwd=2) lines(UKgov.08,col="red",lwd=2) lines(ESgov.08,col="orangered4",lwd=2) lines(ITgov.08,col="aquamarine4", lwd=2) lines(NLgov.08, col="purple4", lwd=2) box() legend("topleft", c("Germany","France","United Kingdom","Spain", "Italy", "Netherlands"), col=c("darkgreen","orange3","red","orangered4", "aquamarine4", "purple4"), lwd=c(2,2,2,2,2,2), lty=c(1,1,1,1,1,1), inset=.02, cex=.75, bg="gray87") mtext("Percentage change from 2008 peak, Seasonally Adjusted", side = 3, line=0.5, cex = 1) mtext("Cooley-Rupert European Economic Snapshot; www.europeansnapshot.com", side = 4, line= 0, cex = .7, adj = 0) mtext("Source: Eurostat", side = 4, line= 1, cex = .7, adj = 0) dev.copy2pdf(file=paste("ALL-rgovch-",Sys.Date(),".pdf", sep=""), width=8, height=6, pointsize=12) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),"/png",sep="")) dev.print(png, file=paste("ALL-rgovch-",Sys.Date(),".png", sep=""), pointsize=12, width=8, height=6, units="in", bg="white", res=400) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),sep="")) ############################################################### #Real Final Consumption Expenditures of Government - Change from Peak - with US plot(UKgov.08, main="Real Final Consumption Expenditures of Government", ylab="", xlab="Quarters from 2008 peak", col="white", type="l", lwd=2, axes=FALSE, yaxs="i", xaxs="i", tck=1, bty="l", family="Times", ylim=c(min(as.numeric(ESgov.08), as.numeric(ITgov.08), as.numeric(UKgov.08), as.numeric(DEgov.08), as.numeric(FRgov.08), as.numeric(NLgov.08),as.numeric(USgov.08), na.rm=TRUE)-1,max(as.numeric(ESgov.08), as.numeric(ITgov.08), as.numeric(UKgov.08), as.numeric(DEgov.08), as.numeric(FRgov.08), as.numeric(NLgov.08),as.numeric(USgov.08), na.rm=TRUE)+1)) axis(2, tick=TRUE, tck=1, lwd.ticks=.1, col.ticks="grey") axis(1, tick=TRUE, las=1, at=c(seq(0,35,4))) abline(h=0) lines(DEgov.08,col="darkgreen",lwd=2) lines(FRgov.08,col="orange3",lwd=2) lines(UKgov.08,col="red",lwd=2) lines(ESgov.08,col="orangered4",lwd=2) lines(ITgov.08,col="aquamarine4", lwd=2) lines(NLgov.08, col="purple4", lwd=2) lines(USgov.08, col="mediumblue", lwd=4) box() legend("topleft", c("Germany","France","United Kingdom","Spain", "Italy", "Netherlands", "United States"), col=c("darkgreen","orange3","red","orangered4", "aquamarine4", "purple4","mediumblue"), lwd=c(2,2,2,2,2,2,2), lty=c(1,1,1,1,1,1,1), inset=.02, cex=.75, bg="gray87") mtext("Percentage change from 2008 peak, Seasonally Adjusted", side = 3, line=0.5, cex = 1) mtext("Cooley-Rupert European Economic Snapshot; www.europeansnapshot.com", side = 4, line= 0, cex = .7, adj = 0) mtext("Source: Eurostat", side = 4, line= 1, cex = .7, adj = 0) dev.copy2pdf(file=paste("US-EU-rgovch-",Sys.Date(),".pdf", sep=""), width=8, height=6, pointsize=12) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),"/png",sep="")) dev.print(png, file=paste("US-EU-rgovch-",Sys.Date(),".png", sep=""), pointsize=12, width=8, height=6, units="in", bg="white", res=400) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),sep="")) ############################################################### #Real Final Consumption Expenditures of Government as a Percentage of GDP - Change from Peak plot(UKgpctA.08, main="Real Final Consumption Expenditures of Government (% of GDP)", ylab="", xlab="Quarters from 2008 peak", col="white", type="l", lwd=2, axes=FALSE, yaxs="i", xaxs="i", tck=1, bty="l", family="Times", ylim=c(min(as.numeric(ESgpctA.08), as.numeric(ITgpctA.08), as.numeric(UKgpctA.08), as.numeric(DEgpctA.08), as.numeric(FRgpctA.08), as.numeric(NLgpctA.08), na.rm=TRUE)-1,max(as.numeric(ESgpctA.08), as.numeric(ITgpctA.08), as.numeric(UKgpctA.08), as.numeric(DEgpctA.08), as.numeric(FRgpctA.08), as.numeric(NLgpctA.08), na.rm=TRUE)+1)) axis(2, tick=TRUE, tck=1, lwd.ticks=.1, col.ticks="grey") axis(1, tick=TRUE, las=1, at=c(seq(0,35,4))) abline(h=0) lines(DEgpctA.08,col="darkgreen",lwd=2) lines(FRgpctA.08,col="orange3",lwd=2) lines(UKgpctA.08,col="red",lwd=2) lines(ESgpctA.08,col="orangered4",lwd=2) lines(ITgpctA.08,col="aquamarine4", lwd=2) lines(NLgpctA.08, col="purple4", lwd=2) box() legend("topleft", c("Germany","France","United Kingdom","Spain", "Italy", "Netherlands"), col=c("darkgreen","orange3","red","orangered4", "aquamarine4", "purple4"), lwd=c(2,2,2,2,2,2), lty=c(1,1,1,1,1,1), inset=.02, cex=.75, bg="gray87") mtext("Change from 2008 peak, Seasonally Adjusted", side = 3, line=0.5, cex = 1) mtext("Cooley-Rupert European Economic Snapshot; www.europeansnapshot.com", side = 4, line= 0, cex = .7, adj = 0) mtext("Source: Eurostat", side = 4, line= 1, cex = .7, adj = 0) dev.copy2pdf(file=paste("ALL-rgpctAch-",Sys.Date(),".pdf", sep=""), width=8, height=6, pointsize=12) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),"/png",sep="")) dev.print(png, file=paste("ALL-rgpctAch-",Sys.Date(),".png", sep=""), pointsize=12, width=8, height=6, units="in", bg="white", res=400) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),sep="")) ############################################################### #Real Final Consumption Expenditures of Government as a Percentage of GDP - Change from Peak - with US plot(UKgpctA.08, main="Real Final Consumption Expenditures of Government (% of GDP)", ylab="", xlab="Quarters from 2008 peak", col="white", type="l", lwd=2, axes=FALSE, yaxs="i", xaxs="i", tck=1, bty="l", family="Times", ylim=c(min(as.numeric(ESgpctA.08), as.numeric(ITgpctA.08), as.numeric(UKgpctA.08), as.numeric(DEgpctA.08), as.numeric(FRgpctA.08), as.numeric(NLgpctA.08),as.numeric(ESgpctA.08), na.rm=TRUE)-1,max(as.numeric(USgpctA.08), as.numeric(ITgpctA.08), as.numeric(UKgpctA.08), as.numeric(DEgpctA.08), as.numeric(FRgpctA.08), as.numeric(NLgpctA.08), as.numeric(USgpctA.08), na.rm=TRUE)+1)) axis(2, tick=TRUE, tck=1, lwd.ticks=.1, col.ticks="grey") axis(1, tick=TRUE, las=1, at=c(seq(0,35,4))) abline(h=0) lines(DEgpctA.08,col="darkgreen",lwd=2) lines(FRgpctA.08,col="orange3",lwd=2) lines(UKgpctA.08,col="red",lwd=2) lines(ESgpctA.08,col="orangered4",lwd=2) lines(ITgpctA.08,col="aquamarine4", lwd=2) lines(NLgpctA.08, col="purple4", lwd=2) lines(USgpctA.08, col="mediumblue", lwd=4) box() legend("topleft", c("Germany","France","United Kingdom","Spain", "Italy", "Netherlands", "United States"), col=c("darkgreen","orange3","red","orangered4", "aquamarine4", "purple4","mediumblue"), lwd=c(2,2,2,2,2,2,2), lty=c(1,1,1,1,1,1,1), inset=.02, cex=.75, bg="gray87") mtext("Change from 2008 peak, Seasonally Adjusted", side = 3, line=0.5, cex = 1) mtext("Cooley-Rupert European Economic Snapshot; www.europeansnapshot.com", side = 4, line= 0, cex = .7, adj = 0) mtext("Source: Eurostat", side = 4, line= 1, cex = .7, adj = 0) dev.copy2pdf(file=paste("US-EU-rgpctAch-",Sys.Date(),".pdf", sep=""), width=8, height=6, pointsize=12) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),"/png",sep="")) dev.print(png, file=paste("US-EU-rgpctAch-",Sys.Date(),".png", sep=""), pointsize=12, width=8, height=6, units="in", bg="white", res=400) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),sep="")) ############################################################### #Real Exports - Change from Peak plot(UKexp.08, main="Real Exports", ylab="", xlab="Quarters from 2008 peak", col="white", type="l", lwd=2, axes=FALSE, yaxs="i", xaxs="i", tck=1, bty="l", family="Times", ylim=c(min(as.numeric(ESexp.08), as.numeric(ITexp.08), as.numeric(UKexp.08), as.numeric(DEexp.08), as.numeric(FRexp.08), as.numeric(NLexp.08), na.rm=TRUE)-1,max(as.numeric(ESexp.08), as.numeric(ITexp.08), as.numeric(UKexp.08), as.numeric(DEexp.08), as.numeric(FRexp.08), as.numeric(NLexp.08), na.rm=TRUE)+1)) axis(2, tick=TRUE, tck=1, lwd.ticks=.1, col.ticks="grey") axis(1, tick=TRUE, las=1, at=c(seq(0,35,4))) abline(h=0) lines(DEexp.08,col="darkgreen",lwd=2) lines(FRexp.08,col="orange3",lwd=2) lines(UKexp.08,col="red",lwd=2) lines(ESexp.08,col="orangered4",lwd=2) lines(ITexp.08,col="aquamarine4", lwd=2) lines(NLexp.08, col="purple4", lwd=2) box() legend("topleft", c("Germany","France","United Kingdom","Spain", "Italy", "Netherlands"), col=c("darkgreen","orange3","red","orangered4", "aquamarine4", "purple4"), lwd=c(2,2,2,2,2,2), lty=c(1,1,1,1,1,1), inset=.02, cex=.75, bg="gray87") mtext("Percentage change from 2008 peak, Seasonally Adjusted", side = 3, line=0.5, cex = 1) mtext("Cooley-Rupert European Economic Snapshot; www.europeansnapshot.com", side = 4, line= 0, cex = .7, adj = 0) mtext("Source: Eurostat", side = 4, line= 1, cex = .7, adj = 0) dev.copy2pdf(file=paste("ALL-rexpch-",Sys.Date(),".pdf", sep=""), width=8, height=6, pointsize=12) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),"/png",sep="")) dev.print(png, file=paste("ALL-rexpch-",Sys.Date(),".png", sep=""), pointsize=12, width=8, height=6, units="in", bg="white", res=400) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),sep="")) ############################################################### #Real Exports - Change from Peak - with US plot(UKexp.08, main="Real Exports", ylab="", xlab="Quarters from 2008 peak", col="white", type="l", lwd=2, axes=FALSE, yaxs="i", xaxs="i", tck=1, bty="l", family="Times", ylim=c(min(as.numeric(ESexp.08), as.numeric(ITexp.08), as.numeric(UKexp.08), as.numeric(DEexp.08), as.numeric(FRexp.08), as.numeric(NLexp.08),as.numeric(USexp.08), na.rm=TRUE)-1,max(as.numeric(ESexp.08), as.numeric(ITexp.08), as.numeric(UKexp.08), as.numeric(DEexp.08), as.numeric(FRexp.08), as.numeric(NLexp.08),as.numeric(USexp.08), na.rm=TRUE)+1)) axis(2, tick=TRUE, tck=1, lwd.ticks=.1, col.ticks="grey") axis(1, tick=TRUE, las=1, at=c(seq(0,35,4))) abline(h=0) lines(DEexp.08,col="darkgreen",lwd=2) lines(FRexp.08,col="orange3",lwd=2) lines(UKexp.08,col="red",lwd=2) lines(ESexp.08,col="orangered4",lwd=2) lines(ITexp.08,col="aquamarine4", lwd=2) lines(NLexp.08, col="purple4", lwd=2) lines(USexp.08, col="mediumblue", lwd=4) box() legend("topleft", c("Germany","France","United Kingdom","Spain", "Italy", "Netherlands", "United States"), col=c("darkgreen","orange3","red","orangered4", "aquamarine4", "purple4","mediumblue"), lwd=c(2,2,2,2,2,2,2), lty=c(1,1,1,1,1,1,1), inset=.02, cex=.75, bg="gray87") mtext("Percentage change from 2008 peak, Seasonally Adjusted", side = 3, line=0.5, cex = 1) mtext("Cooley-Rupert European Economic Snapshot; www.europeansnapshot.com", side = 4, line= 0, cex = .7, adj = 0) mtext("Source: Eurostat", side = 4, line= 1, cex = .7, adj = 0) dev.copy2pdf(file=paste("US-EU-rexpch-",Sys.Date(),".pdf", sep=""), width=8, height=6, pointsize=12) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),"/png",sep="")) dev.print(png, file=paste("US-EU-rexpch-",Sys.Date(),".png", sep=""), pointsize=12, width=8, height=6, units="in", bg="white", res=400) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),sep="")) ############################################################## #Real Imports - Change from Peak plot(UKimp.08, main="Real Imports", ylab="", xlab="Quarters from 2008 peak", col="white", type="l", lwd=2, axes=FALSE, yaxs="i", xaxs="i", tck=1, bty="l", family="Times", ylim=c(min(as.numeric(ESimp.08), as.numeric(ITimp.08), as.numeric(UKimp.08), as.numeric(DEimp.08), as.numeric(FRimp.08), as.numeric(NLimp.08), na.rm=TRUE)-1,max(as.numeric(ESimp.08), as.numeric(ITimp.08), as.numeric(UKimp.08), as.numeric(DEimp.08), as.numeric(FRimp.08), as.numeric(NLimp.08), na.rm=TRUE)+1)) axis(2, tick=TRUE, tck=1, lwd.ticks=.1, col.ticks="grey") axis(1, tick=TRUE, las=1, at=c(seq(0,35,4))) abline(h=0) lines(DEimp.08,col="darkgreen",lwd=2) lines(FRimp.08,col="orange3",lwd=2) lines(UKimp.08,col="red",lwd=2) lines(ESimp.08,col="orangered4",lwd=2) lines(ITimp.08,col="aquamarine4", lwd=2) lines(NLimp.08, col="purple4", lwd=2) box() legend("topleft", c("Germany","France","United Kingdom","Spain", "Italy", "Netherlands"), col=c("darkgreen","orange3","red","orangered4", "aquamarine4", "purple4"), lwd=c(2,2,2,2,2,2), lty=c(1,1,1,1,1,1), inset=.02, cex=.75, bg="gray87") mtext("Percentage change from 2008 peak, Seasonally Adjusted", side = 3, line=0.5, cex = 1) mtext("Cooley-Rupert European Economic Snapshot; www.europeansnapshot.com", side = 4, line= 0, cex = .7, adj = 0) mtext("Source: Eurostat", side = 4, line= 1, cex = .7, adj = 0) dev.copy2pdf(file=paste("ALL-rimpch-",Sys.Date(),".pdf", sep=""), width=8, height=6, pointsize=12) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),"/png",sep="")) dev.print(png, file=paste("ALL-rimpch-",Sys.Date(),".png", sep=""), pointsize=12, width=8, height=6, units="in", bg="white", res=400) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),sep="")) ############################################################### #Real Imports - Change from Peak - with US plot(UKimp.08, main="Real Imports", ylab="", xlab="Quarters from 2008 peak", col="white", type="l", lwd=2, axes=FALSE, yaxs="i", xaxs="i", tck=1, bty="l", family="Times", ylim=c(min(as.numeric(ESimp.08), as.numeric(ITimp.08), as.numeric(UKimp.08), as.numeric(DEimp.08), as.numeric(FRimp.08), as.numeric(NLimp.08),as.numeric(USimp.08), na.rm=TRUE)-1,max(as.numeric(ESimp.08), as.numeric(ITimp.08), as.numeric(UKimp.08), as.numeric(DEimp.08), as.numeric(FRimp.08), as.numeric(NLimp.08),as.numeric(USimp.08), na.rm=TRUE)+1)) axis(2, tick=TRUE, tck=1, lwd.ticks=.1, col.ticks="grey") axis(1, tick=TRUE, las=1, at=c(seq(0,35,4))) abline(h=0) lines(DEimp.08,col="darkgreen",lwd=2) lines(FRimp.08,col="orange3",lwd=2) lines(UKimp.08,col="red",lwd=2) lines(ESimp.08,col="orangered4",lwd=2) lines(ITimp.08,col="aquamarine4", lwd=2) lines(NLimp.08, col="purple4", lwd=2) lines(USimp.08, col="mediumblue", lwd=4) box() legend("topleft", c("Germany","France","United Kingdom","Spain", "Italy", "Netherlands", "United States"), col=c("darkgreen","orange3","red","orangered4", "aquamarine4", "purple4","mediumblue"), lwd=c(2,2,2,2,2,2,2), lty=c(1,1,1,1,1,1,1), inset=.02, cex=.75, bg="gray87") mtext("Percentage change from 2008 peak, Seasonally Adjusted", side = 3, line=0.5, cex = 1) mtext("Cooley-Rupert European Economic Snapshot; www.europeansnapshot.com", side = 4, line= 0, cex = .7, adj = 0) mtext("Source: Eurostat", side = 4, line= 1, cex = .7, adj = 0) dev.copy2pdf(file=paste("US-EU-rimpch-",Sys.Date(),".pdf", sep=""), width=8, height=6, pointsize=12) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),"/png",sep="")) dev.print(png, file=paste("US-EU-rimpch-",Sys.Date(),".png", sep=""), pointsize=12, width=8, height=6, units="in", bg="white", res=400) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),sep="")) ############################################################### #Government Consolidated Gross Debt - Change from Peak plot(UKdebt.08, main="Government Consolidated Gross Debt", ylab="", xlab="Quarters from 2008 peak", col="white", type="l", lwd=2, axes=FALSE, yaxs="i", xaxs="i", tck=1, bty="l", family="Times", ylim=c(min(as.numeric(ESdebt.08), as.numeric(ITdebt.08), as.numeric(UKdebt.08), as.numeric(DEdebt.08), as.numeric(FRdebt.08), as.numeric(NLdebt.08), na.rm=TRUE)-1,max(as.numeric(ESdebt.08), as.numeric(ITdebt.08), as.numeric(UKdebt.08), as.numeric(DEdebt.08), as.numeric(FRdebt.08), as.numeric(NLdebt.08), na.rm=TRUE)+1)) axis(2, tick=TRUE, tck=1, lwd.ticks=.1, col.ticks="grey") axis(1, tick=TRUE, las=1, at=c(seq(0,35,4))) abline(h=0) lines(DEdebt.08,col="darkgreen",lwd=2) lines(FRdebt.08,col="orange3",lwd=2) lines(UKdebt.08,col="red",lwd=2) lines(ESdebt.08,col="orangered4",lwd=2) lines(ITdebt.08,col="aquamarine4", lwd=2) lines(NLdebt.08, col="purple4", lwd=2) box() legend("topleft", c("Germany","France","United Kingdom","Spain", "Italy", "Netherlands"), col=c("darkgreen","orange3","red","orangered4", "aquamarine4", "purple4"), lwd=c(2,2,2,2,2,2), lty=c(1,1,1,1,1,1), inset=.02, cex=.75, bg="gray87") mtext("Percentage change from 2008 peak", side = 3, line=0.5, cex = 1) mtext("Cooley-Rupert European Economic Snapshot; www.europeansnapshot.com", side = 4, line= 0, cex = .7, adj = 0) mtext("Source: Eurostat", side = 4, line= 1, cex = .7, adj = 0) dev.copy2pdf(file=paste("ALL-debtch-",Sys.Date(),".pdf", sep=""), width=8, height=6, pointsize=12) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),"/png",sep="")) dev.print(png, file=paste("ALL-debtch-",Sys.Date(),".png", sep=""), pointsize=12, width=8, height=6, units="in", bg="white", res=400) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),sep="")) ############################################################### #Intergovernmental lending within EU27 in the context of the financial crisis plot(window(gov$DElend, start=c(2009,1),end=NULL), main="Intergovernmental Financial Crisis Lending Within EU27", ylab="Millions of Euro", xlab="Years", col="white", type="l", lwd=2, axes=FALSE, yaxs="i", xaxs="i", tck=1, bty="l", family="Times" ) axis(2, tick=TRUE, tck=1, lwd.ticks=.1, col.ticks="grey") axis(1, tick=TRUE, las=1, ) abline(h=0) lines(window(gov$DElend, start=c(2009,1),end=NULL),col="darkgreen",lwd=2) lines(window(gov$FRlend, start=c(2009,1),end=NULL),col="orange3",lwd=2) lines(window(gov$UKlend, start=c(2009,1),end=NULL),col="red",lwd=2) lines(window(gov$ESlend, start=c(2009,1),end=NULL),col="orangered4",lwd=2) lines(window(gov$ITlend, start=c(2009,1),end=NULL),col="aquamarine4", lwd=2) lines(window(gov$NLlend, start=c(2009,1),end=NULL),col="purple4", lwd=2) box() legend("topleft", c("Germany","France","United Kingdom","Spain", "Italy", "Netherlands"), col=c("darkgreen","orange3","red","orangered4", "aquamarine4", "purple4"), lwd=c(2,2,2,2,2,2), lty=c(1,1,1,1,1,1), inset=.02, cex=.75, bg="gray87") mtext("Cooley-Rupert European Economic Snapshot; www.europeansnapshot.com", side = 4, line= 0, cex = .7, adj = 0) mtext("Source: Eurostat", side = 4, line= 1, cex = .7, adj = 0) dev.copy2pdf(file=paste("ALL-lend-",Sys.Date(),".pdf", sep=""), width=8, height=6, pointsize=12) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),"/png",sep="")) dev.print(png, file=paste("ALL-lend-",Sys.Date(),".png", sep=""), pointsize=12, width=8, height=6, units="in", bg="white", res=400) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),sep="")) ############################################################### #Net Lending (+)/ Net Borrowing (-) plot(borrow$DEborrow, main="Net Lending (+)/ Net Borrowing (-)", ylim=c(min(as.numeric(borrow$ESborrow), as.numeric(borrow$ITborrow), as.numeric(borrow$UKborrow), as.numeric(borrow$DEborrow), as.numeric(borrow$FRborrow), as.numeric(borrow$NLborrow), na.rm=TRUE)-1,max(as.numeric(borrow$ESborrow), as.numeric(borrow$ITborrow), as.numeric(borrow$UKborrow), as.numeric(borrow$DEborrow), as.numeric(borrow$FRborrow), as.numeric(borrow$NLborrow), na.rm=TRUE)+1), ylab="Millions of Euro", xlab="Years", col="white", type="l", lwd=2, axes=FALSE, yaxs="i", xaxs="i", yaxt="n", tck=1, bty="l", family="Times" ) axis(2, tick=TRUE, tck=1, lwd.ticks=.1, col.ticks="grey", at=axTicks(2), labels=(sprintf("%1.f", axTicks(2))) ) axis(1, tick=TRUE, las=1, ) abline(h=0) lines(borrow$DEborrow,col="darkgreen",lwd=2) lines(borrow$FRborrow,col="orange3",lwd=2) lines(borrow$UKborrow,col="red",lwd=2) lines(borrow$ESborrow,col="orangered4",lwd=2) lines(borrow$ITborrow,col="aquamarine4", lwd=2) lines(borrow$NLborrow,col="purple4", lwd=2) box() legend("topleft", c("Germany","France","United Kingdom","Spain", "Italy", "Netherlands"), col=c("darkgreen","orange3","red","orangered4", "aquamarine4", "purple4"), lwd=c(2,2,2,2,2,2), lty=c(1,1,1,1,1,1), inset=.02, cex=.75, bg="gray87") mtext("Cooley-Rupert European Economic Snapshot; www.europeansnapshot.com", side = 4, line= 0, cex = .7, adj = 0) mtext("Source: Eurostat", side = 4, line= 1, cex = .7, adj = 0) dev.copy2pdf(file=paste("ALL-borrow-",Sys.Date(),".pdf", sep=""), width=8, height=6, pointsize=12) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),"/png",sep="")) dev.print(png, file=paste("ALL-borrow-",Sys.Date(),".png", sep=""), pointsize=12, width=8, height=6, units="in", bg="white", res=400) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),sep="")) ############################################################### #Net Lending (+)/ Net Borrowing (-) as a Percentage of GDP plot(borrow$DEbpct, main="Net Lending (+)/ Net Borrowing (-) (% of GDP)", ylim=c(min(as.numeric(borrow$ESbpct), as.numeric(borrow$ITbpct), as.numeric(borrow$UKbpct), as.numeric(borrow$DEbpct), as.numeric(borrow$FRbpct), as.numeric(borrow$NLbpct), na.rm=TRUE)-1,max(as.numeric(borrow$ESbpct), as.numeric(borrow$ITbpct), as.numeric(borrow$UKbpct), as.numeric(borrow$DEbpct), as.numeric(borrow$FRbpct), as.numeric(borrow$NLbpct), na.rm=TRUE)+1), ylab="", xlab="Years", col="white", type="l", lwd=2, axes=FALSE, yaxs="i", xaxs="i", tck=1, bty="l", family="Times" ) axis(2, tick=TRUE, tck=1, lwd.ticks=.1, col.ticks="grey") axis(1, tick=TRUE, las=1, ) abline(h=0) lines(borrow$DEbpct,col="darkgreen",lwd=2) lines(borrow$FRbpct,col="orange3",lwd=2) lines(borrow$UKbpct,col="red",lwd=2) lines(borrow$ESbpct,col="orangered4",lwd=2) lines(borrow$ITbpct,col="aquamarine4", lwd=2) lines(borrow$NLbpct,col="purple4", lwd=2) box() legend("topleft", c("Germany","France","United Kingdom","Spain", "Italy", "Netherlands"), col=c("darkgreen","orange3","red","orangered4", "aquamarine4", "purple4"), lwd=c(2,2,2,2,2,2), lty=c(1,1,1,1,1,1), inset=.02, cex=.75, bg="gray87") mtext("Cooley-Rupert European Economic Snapshot; www.europeansnapshot.com", side = 4, line= 0, cex = .7, adj = 0) mtext("Source: Eurostat", side = 4, line= 1, cex = .7, adj = 0) dev.copy2pdf(file=paste("ALL-bpct-",Sys.Date(),".pdf", sep=""), width=8, height=6, pointsize=12) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),"/png",sep="")) dev.print(png, file=paste("ALL-bpct-",Sys.Date(),".png", sep=""), pointsize=12, width=8, height=6, units="in", bg="white", res=400) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),sep="")) ############################################################### #Net Lending (+)/ Net Borrowing (-) - Change from Peak plot(UKborrow.08, main="Net Lending (+)/ Net Borrowing (-)", ylab="", xlab="Quarters from 2008 peak", col="white", type="l", lwd=2, axes=FALSE, yaxs="i", xaxs="i", tck=1, bty="l", family="Times", ylim=c(min(as.numeric(ESborrow.08), as.numeric(ITborrow.08), as.numeric(UKborrow.08), as.numeric(DEborrow.08), as.numeric(FRborrow.08), as.numeric(NLborrow.08), na.rm=TRUE)-1,max(as.numeric(ESborrow.08), as.numeric(ITborrow.08), as.numeric(UKborrow.08), as.numeric(DEborrow.08), as.numeric(FRborrow.08), as.numeric(NLborrow.08), na.rm=TRUE)+1)) axis(2, tick=TRUE, tck=1, lwd.ticks=.1, col.ticks="grey") axis(1, tick=TRUE, las=1, at=c(seq(0,35,4))) abline(h=0) lines(DEborrow.08,col="darkgreen",lwd=2) lines(FRborrow.08,col="orange3",lwd=2) lines(UKborrow.08,col="red",lwd=2) lines(ESborrow.08,col="orangered4",lwd=2) lines(ITborrow.08,col="aquamarine4", lwd=2) lines(NLborrow.08, col="purple4", lwd=2) box() legend("topleft", c("Germany","France","United Kingdom","Spain", "Italy", "Netherlands"), col=c("darkgreen","orange3","red","orangered4", "aquamarine4", "purple4"), lwd=c(2,2,2,2,2,2), lty=c(1,1,1,1,1,1), inset=.02, cex=.75, bg="gray87") mtext("Percentage change from 2008 peak", side = 3, line=0.5, cex = 1) mtext("Cooley-Rupert European Economic Snapshot; www.europeansnapshot.com", side = 4, line= 0, cex = .7, adj = 0) mtext("Source: Eurostat", side = 4, line= 1, cex = .7, adj = 0) dev.copy2pdf(file=paste("ALL-borrowch-",Sys.Date(),".pdf", sep=""), width=8, height=6, pointsize=12) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),"/png",sep="")) dev.print(png, file=paste("ALL-borrowch-",Sys.Date(),".png", sep=""), pointsize=12, width=8, height=6, units="in", bg="white", res=400) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),sep="")) ############################################################### #Net Lending (+)/ Net Borrowing (-) as a Percentage of GDP - Change from Peak plot(UKbpctA.08, main="Net Lending (+)/ Net Borrowing (-) (% of GDP)", ylab="", xlab="Quarters from 2008 peak", col="white", type="l", lwd=2, axes=FALSE, yaxs="i", xaxs="i", tck=1, bty="l", family="Times", ylim=c(min(as.numeric(ESbpctA.08), as.numeric(ITbpctA.08), as.numeric(UKbpctA.08), as.numeric(DEbpctA.08), as.numeric(FRbpctA.08), as.numeric(NLbpctA.08), na.rm=TRUE)-1,max(as.numeric(ESbpctA.08), as.numeric(ITbpctA.08), as.numeric(UKbpctA.08), as.numeric(DEbpctA.08), as.numeric(FRbpctA.08), as.numeric(NLbpctA.08), na.rm=TRUE)+1)) axis(2, tick=TRUE, tck=1, lwd.ticks=.1, col.ticks="grey") axis(1, tick=TRUE, las=1, at=c(seq(0,35,4))) abline(h=0) lines(DEbpctA.08,col="darkgreen",lwd=2) lines(FRbpctA.08,col="orange3",lwd=2) lines(UKbpctA.08,col="red",lwd=2) lines(ESbpctA.08,col="orangered4",lwd=2) lines(ITbpctA.08,col="aquamarine4", lwd=2) lines(NLbpctA.08, col="purple4", lwd=2) box() legend("topleft", c("Germany","France","United Kingdom","Spain", "Italy", "Netherlands"), col=c("darkgreen","orange3","red","orangered4", "aquamarine4", "purple4"), lwd=c(2,2,2,2,2,2), lty=c(1,1,1,1,1,1), inset=.02, cex=.75, bg="gray87") mtext("Change from 2008 peak", side = 3, line=0.5, cex = 1) mtext("Cooley-Rupert European Economic Snapshot; www.europeansnapshot.com", side = 4, line= 0, cex = .7, adj = 0) mtext("Source: Eurostat", side = 4, line= 1, cex = .7, adj = 0) dev.copy2pdf(file=paste("ALL-bpctAch-",Sys.Date(),".pdf", sep=""), width=8, height=6, pointsize=12) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),"/png",sep="")) dev.print(png, file=paste("ALL-bpctAch-",Sys.Date(),".png", sep=""), pointsize=12, width=8, height=6, units="in", bg="white", res=400) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),sep="")) ################################### Labor Market ######################################## #Download bulk dataset from Eurostat for employment rm(data) temp <- tempfile() download.file("http://epp.eurostat.ec.europa.eu/NavTree_prod/everybody/BulkDownloadListing?sort=1&file=data%2Flfsi_emp_q.tsv.gz",temp) data <- read.delim(gzfile(temp), header=FALSE, row.names=1, stringsAsFactors=FALSE,na.strings=": ") data<-t(data) unlink(temp) #NOTE: This variable is thousands of persons and is based on the Labour Force Survey #Total employment (resident population concept - LFS) #Resident population definiation refers to total employment of residents of a particular county, regardless of where their employment takes place rm(labor) labor<-data.frame(row.names=data[,"sex,indic_em,geo\\time"]) labor$DEemp<-ts(data[nrow(data):1,"T,EMP_LFS,DE"], start=c(1992,1), deltat=1/4) labor$FRemp<-ts(data[nrow(data):1,"T,EMP_LFS,FR"], start=c(1992,1), deltat=1/4) labor$UKemp<-ts(data[nrow(data):1,"T,EMP_LFS,UK"], start=c(1992,1), deltat=1/4) labor$ESemp<-ts(data[nrow(data):1,"T,EMP_LFS,ES"], start=c(1992,1), deltat=1/4) labor$ITemp<-ts(data[nrow(data):1,"T,EMP_LFS,IT"], start=c(1992,1), deltat=1/4) labor$NLemp<-ts(data[nrow(data):1,"T,EMP_LFS,NL"], start=c(1992,1), deltat=1/4) labor$DEemp<-gsub('b','',labor$DEemp) labor$FRemp<-gsub('b','',labor$FRemp) labor$UKemp<-gsub('b','',labor$UKemp) labor$ESemp<-gsub('b','',labor$ESemp) labor$ITemp<-gsub('b','',labor$ITemp) labor$NLemp<-gsub('b','',labor$NLemp) #Total Employment, 15 to 64 years old (LFS) rm(labor.15.64) labor.15.64<-data.frame(row.names=data[,"sex,indic_em,geo\\time"]) labor.15.64$DEemp<-ts(data[nrow(data):1,"T,EMP_15_64,DE"], start=c(1992,1), deltat=1/4) labor.15.64$FRemp<-ts(data[nrow(data):1,"T,EMP_15_64,FR"], start=c(1992,1), deltat=1/4) labor.15.64$UKemp<-ts(data[nrow(data):1,"T,EMP_15_64,UK"], start=c(1992,1), deltat=1/4) labor.15.64$ESemp<-ts(data[nrow(data):1,"T,EMP_15_64,ES"], start=c(1992,1), deltat=1/4) labor.15.64$ITemp<-ts(data[nrow(data):1,"T,EMP_15_64,IT"], start=c(1992,1), deltat=1/4) labor.15.64$NLemp<-ts(data[nrow(data):1,"T,EMP_15_64,NL"], start=c(1992,1), deltat=1/4) labor.15.64$DEemp<-gsub('b','',labor.15.64$DEemp) labor.15.64$FRemp<-gsub('b','',labor.15.64$FRemp) labor.15.64$UKemp<-gsub('b','',labor.15.64$UKemp) labor.15.64$ESemp<-gsub('b','',labor.15.64$ESemp) labor.15.64$ITemp<-gsub('b','',labor.15.64$ITemp) labor.15.64$NLemp<-gsub('b','',labor.15.64$NLemp) #Download bulk dataset from Eurostat for Employment growth and activity branches rm(data) temp <- tempfile() download.file("http://epp.eurostat.ec.europa.eu/NavTree_prod/everybody/BulkDownloadListing?sort=1&file=data%2Flfsi_grt_q.tsv.gz",temp) data <- read.delim(gzfile(temp), header=FALSE, row.names=1, stringsAsFactors=FALSE, na.strings=": ") data<-t(data) unlink(temp) #NOTE: This variable is thousands of persons and is based on the National Accounts #Total employment (domestic concept - ESA) #Domestic employment concept refers to total employment of persons working within a country's borders, regarless of where their residence is. labor$DEemp2<-ts(data[nrow(data):1,"T,EMP,DE"], start=c(1992,1), deltat=1/4) labor$FRemp2<-ts(data[nrow(data):1,"T,EMP,FR"], start=c(1992,1), deltat=1/4) labor$UKemp2<-ts(data[nrow(data):1,"T,EMP,UK"], start=c(1992,1), deltat=1/4) labor$ESemp2<-ts(data[nrow(data):1,"T,EMP,ES"], start=c(1992,1), deltat=1/4) labor$ITemp2<-ts(data[nrow(data):1,"T,EMP,IT"], start=c(1992,1), deltat=1/4) labor$NLemp2<-ts(data[nrow(data):1,"T,EMP,NL"], start=c(1992,1), deltat=1/4) labor$DEemp2<-gsub('i','',labor$DEemp2) labor$FRemp2<-gsub('i','',labor$FRemp2) labor$UKemp2<-gsub('i','',labor$UKemp2) labor$ESemp2<-gsub('i','',labor$ESemp2) labor$ITemp2<-gsub('i','',labor$ITemp2) labor$NLemp2<-gsub('i','',labor$NLemp2) #Download bulk dataset from Eurostat for Unemployment Rates, Monthly average, by sex and age groups rm(data) temp <- tempfile() download.file("http://epp.eurostat.ec.europa.eu/NavTree_prod/everybody/BulkDownloadListing?sort=1&file=data%2Fune_rt_m.tsv.gz",temp) data <- read.delim(gzfile(temp), header=FALSE, row.names=1, stringsAsFactors=FALSE, na.strings=": ") data<-t(data) unlink(temp) #NOTE: #Unemployment Rates rm(unemp) unemp<-data.frame(row.names=data[,"s_adj,age,sex,geo\\time"]) unemp$DEunemp<-ts(data[nrow(data):1,"SA,TOTAL,T,DE"], start=c(1983,1), deltat=1/12) unemp$FRunemp<-ts(data[nrow(data):1,"SA,TOTAL,T,FR"], start=c(1983,1), deltat=1/12) unemp$UKunemp<-ts(data[nrow(data):1,"SA,TOTAL,T,UK"], start=c(1983,1), deltat=1/12) unemp$ESunemp<-ts(data[nrow(data):1,"SA,TOTAL,T,ES"], start=c(1983,1), deltat=1/12) unemp$ITunemp<-ts(data[nrow(data):1,"SA,TOTAL,T,IT"], start=c(1983,1), deltat=1/12) unemp$NLunemp<-ts(data[nrow(data):1,"SA,TOTAL,T,NL"], start=c(1983,1), deltat=1/12) unemp$USunemp<-ts(data[nrow(data):1,"SA,TOTAL,T,US"], start=c(1983,1), deltat=1/12) unemp$DEunemp<-gsub('p','',unemp$DEunemp) unemp$FRunemp<-gsub('p','',unemp$FRunemp) unemp$UKunemp<-gsub('p','',unemp$UKunemp) unemp$ESunemp<-gsub('p','',unemp$ESunemp) unemp$ITunemp<-gsub('p','',unemp$ITunemp) unemp$NLunemp<-gsub('p','',unemp$NLunemp) unemp$USunemp<-gsub('p','',unemp$USunemp) #Download bulk dataset from Eurostat for Unemployment Rates, Monthly average, by sex and age groups rm(data) temp <- tempfile() download.file("http://epp.eurostat.ec.europa.eu/NavTree_prod/everybody/BulkDownloadListing?sort=1&file=data%2Fune_ltu_q.tsv.gz",temp) data <- read.delim(gzfile(temp), header=FALSE, row.names=1, stringsAsFactors=FALSE, na.strings=": ") data<-t(data) unlink(temp) #NOTE: #Long Term Unemployment Rates rm(lturate) lturate<-data.frame(row.names=data[,"sex,indic_em,geo\\time"]) lturate$DElturate<-ts(data[nrow(data):1,"T,LTU_ACT_RT,DE"], start=c(1992,1), deltat=1/4) lturate$FRlturate<-ts(data[nrow(data):1,"T,LTU_ACT_RT,FR"], start=c(1991,1), deltat=1/4) lturate$UKlturate<-ts(data[nrow(data):1,"T,LTU_ACT_RT,UK"], start=c(1992,1), deltat=1/4) lturate$ESlturate<-ts(data[nrow(data):1,"T,LTU_ACT_RT,ES"], start=c(1992,1), deltat=1/4) lturate$ITlturate<-ts(data[nrow(data):1,"T,LTU_ACT_RT,IT"], start=c(1992,1), deltat=1/4) lturate$NLlturate<-ts(data[nrow(data):1,"T,LTU_ACT_RT,NL"], start=c(1992,1), deltat=1/4) lturate$DElturate<-gsub('b','',lturate$DElturate) lturate$FRlturate<-gsub('b','',lturate$FRlturate) lturate$UKlturate<-gsub('b','',lturate$UKlturate) lturate$ESlturate<-gsub('b','',lturate$ESlturate) lturate$ITlturate<-gsub('b','',lturate$ITlturate) lturate$NLlturate<-gsub('b','',lturate$NLlturate) #Download bulk dataset from Eurostat for Population and Activity rm(data) temp <- tempfile() download.file("http://epp.eurostat.ec.europa.eu/NavTree_prod/everybody/BulkDownloadListing?sort=1&file=data%2Flfsi_act_q.tsv.gz",temp) data <- read.delim(gzfile(temp), header=FALSE, row.names=1, stringsAsFactors=FALSE,na.strings=": ") data<-t(data) unlink(temp) #NOTE: This variable is thousands of persons and is based on the Labour Force Survey #Labor Force Participation Rate 15-64 years old (LFS Survey) rm(lfp.15.64) lfp.15.64<-data.frame(row.names=data[,"sex,indic_em,geo\\time"]) lfp.15.64$DElfp.15.64<-ts(data[nrow(data):1,"T,ACT_RT_15_64,DE"], start=c(1992,1), deltat=1/4) lfp.15.64$FRlfp.15.64<-ts(data[nrow(data):1,"T,ACT_RT_15_64,FR"], start=c(1992,1), deltat=1/4) lfp.15.64$UKlfp.15.64<-ts(data[nrow(data):1,"T,ACT_RT_15_64,UK"], start=c(1992,1), deltat=1/4) lfp.15.64$ESlfp.15.64<-ts(data[nrow(data):1,"T,ACT_RT_15_64,ES"], start=c(1992,1), deltat=1/4) lfp.15.64$ITlfp.15.64<-ts(data[nrow(data):1,"T,ACT_RT_15_64,IT"], start=c(1992,1), deltat=1/4) lfp.15.64$NLlfp.15.64<-ts(data[nrow(data):1,"T,ACT_RT_15_64,NL"], start=c(1992,1), deltat=1/4) lfp.15.64$DElfp.15.64<-gsub('b','',lfp.15.64$DElfp.15.64) lfp.15.64$FRlfp.15.64<-gsub('b','',lfp.15.64$FRlfp.15.64) lfp.15.64$UKlfp.15.64<-gsub('b','',lfp.15.64$UKlfp.15.64) lfp.15.64$ESlfp.15.64<-gsub('b','',lfp.15.64$ESlfp.15.64) lfp.15.64$ITlfp.15.64<-gsub('b','',lfp.15.64$ITlfp.15.64) lfp.15.64$NLlfp.15.64<-gsub('b','',lfp.15.64$NLlfp.15.64) #Labor Force Participation Rate 15-64 years old (LFS Survey) rm(lfp.female) lfp.female<-data.frame(row.names=data[,"sex,indic_em,geo\\time"]) lfp.female$DElfp.female<-ts(data[nrow(data):1,"F,ACT_RT_15_64,DE"], start=c(1992,1), deltat=1/4) lfp.female$FRlfp.female<-ts(data[nrow(data):1,"F,ACT_RT_15_64,FR"], start=c(1992,1), deltat=1/4) lfp.female$UKlfp.female<-ts(data[nrow(data):1,"F,ACT_RT_15_64,UK"], start=c(1992,1), deltat=1/4) lfp.female$ESlfp.female<-ts(data[nrow(data):1,"F,ACT_RT_15_64,ES"], start=c(1992,1), deltat=1/4) lfp.female$ITlfp.female<-ts(data[nrow(data):1,"F,ACT_RT_15_64,IT"], start=c(1992,1), deltat=1/4) lfp.female$NLlfp.female<-ts(data[nrow(data):1,"F,ACT_RT_15_64,NL"], start=c(1992,1), deltat=1/4) lfp.female$DElfp.female<-gsub('b','',lfp.female$DElfp.female) lfp.female$FRlfp.female<-gsub('b','',lfp.female$FRlfp.female) lfp.female$UKlfp.female<-gsub('b','',lfp.female$UKlfp.female) lfp.female$ESlfp.female<-gsub('b','',lfp.female$ESlfp.female) lfp.female$ITlfp.female<-gsub('b','',lfp.female$ITlfp.female) lfp.female$NLlfp.female<-gsub('b','',lfp.female$NLlfp.female) #Total Popualtion (LFS Survey) rm(pop) pop<-data.frame(row.names=data[,"sex,indic_em,geo\\time"]) pop$DEpop<-ts(data[nrow(data):1,"T,POP,DE"], start=c(1992,1), deltat=1/4) pop$FRpop<-ts(data[nrow(data):1,"T,POP,FR"], start=c(1992,1), deltat=1/4) pop$UKpop<-ts(data[nrow(data):1,"T,POP,UK"], start=c(1992,1), deltat=1/4) pop$ESpop<-ts(data[nrow(data):1,"T,POP,ES"], start=c(1992,1), deltat=1/4) pop$ITpop<-ts(data[nrow(data):1,"T,POP,IT"], start=c(1992,1), deltat=1/4) pop$NLpop<-ts(data[nrow(data):1,"T,POP,NL"], start=c(1992,1), deltat=1/4) pop$DEpop<-gsub('b','',pop$DEpop) pop$FRpop<-gsub('b','',pop$FRpop) pop$UKpop<-gsub('b','',pop$UKpop) pop$ESpop<-gsub('b','',pop$ESpop) pop$ITpop<-gsub('b','',pop$ITpop) pop$NLpop<-gsub('b','',pop$NLpop) #Total Popualtion, 15 to 64 years of age (LFS Survey) rm(pop.15.64) pop.15.64<-data.frame(row.names=data[,"sex,indic_em,geo\\time"]) pop.15.64$DEpop<-ts(data[nrow(data):1,"T,POP_15_64,DE"], start=c(1992,1), deltat=1/4) pop.15.64$FRpop<-ts(data[nrow(data):1,"T,POP_15_64,FR"], start=c(1992,1), deltat=1/4) pop.15.64$UKpop<-ts(data[nrow(data):1,"T,POP_15_64,UK"], start=c(1992,1), deltat=1/4) pop.15.64$ESpop<-ts(data[nrow(data):1,"T,POP_15_64,ES"], start=c(1992,1), deltat=1/4) pop.15.64$ITpop<-ts(data[nrow(data):1,"T,POP_15_64,IT"], start=c(1992,1), deltat=1/4) pop.15.64$NLpop<-ts(data[nrow(data):1,"T,POP_15_64,NL"], start=c(1992,1), deltat=1/4) pop.15.64$DEpop<-gsub('b','',pop.15.64$DEpop) pop.15.64$FRpop<-gsub('b','',pop.15.64$FRpop) pop.15.64$UKpop<-gsub('b','',pop.15.64$UKpop) pop.15.64$ESpop<-gsub('b','',pop.15.64$ESpop) pop.15.64$ITpop<-gsub('b','',pop.15.64$ITpop) pop.15.64$NLpop<-gsub('b','',pop.15.64$NLpop) #Download bulk dataset from Eurostat for Average number of usual weekly hours of work in main job rm(data) temp <- tempfile() download.file("http://epp.eurostat.ec.europa.eu/NavTree_prod/everybody/BulkDownloadListing?sort=1&file=data%2Flfsq_ewhuis.tsv.gz",temp) data <- read.delim(gzfile(temp), header=FALSE, row.names=1, stringsAsFactors=FALSE) data<-t(data) unlink(temp) #Average number of usual weekly hours of work in main job rm(hours) hours<-data.frame(row.names=data[,"sex,worktime,wstatus,isco,geo\\time"]) hours$DEhours<-ts(data[nrow(data):1,"T,TOTAL,EMP,TOTAL,DE"], start=c(1998,1), deltat=1/4) hours$FRhours<-ts(data[nrow(data):1,"T,TOTAL,EMP,TOTAL,FR"], start=c(1998,1), deltat=1/4) hours$UKhours<-ts(data[nrow(data):1,"T,TOTAL,EMP,TOTAL,UK"], start=c(1998,1), deltat=1/4) hours$EShours<-ts(data[nrow(data):1,"T,TOTAL,EMP,TOTAL,ES"], start=c(1998,1), deltat=1/4) hours$IThours<-ts(data[nrow(data):1,"T,TOTAL,EMP,TOTAL,IT"], start=c(1998,1), deltat=1/4) hours$NLhours<-ts(data[nrow(data):1,"T,TOTAL,EMP,TOTAL,NL"], start=c(1998,1), deltat=1/4) hours$DEhours<-gsub('b','',hours$DEhours) hours$FRhours<-gsub('b','',hours$FRhours) hours$UKhours<-gsub('b','',hours$UKhours) hours$EShours<-gsub('b','',hours$EShours) hours$IThours<-gsub('b','',hours$IThours) hours$NLhours<-gsub('b','',hours$NLhours) #Download bulk dataset from Eurostat for Employment/Population ratios by age/sex/nationality rm(data) temp <- tempfile() download.file("http://epp.eurostat.ec.europa.eu/NavTree_prod/everybody/BulkDownloadListing?sort=1&file=data%2Flfsq_ergan.tsv.gz",temp) data <- read.delim(gzfile(temp), header=FALSE, row.names=1, stringsAsFactors=FALSE) data<-t(data) unlink(temp) #Employment/Population Ratio for ages 15 and older rm(erate) erate<-data.frame(row.names=data[,"sex,age,citizen,geo\\time"]) erate$DEerate<-ts(data[nrow(data):1,"T,Y_GE15,TOTAL,DE"], start=c(1998,1), deltat=1/4) erate$FRerate<-ts(data[nrow(data):1,"T,Y_GE15,TOTAL,FR"], start=c(1998,1), deltat=1/4) erate$UKerate<-ts(data[nrow(data):1,"T,Y_GE15,TOTAL,UK"], start=c(1998,1), deltat=1/4) erate$ESerate<-ts(data[nrow(data):1,"T,Y_GE15,TOTAL,ES"], start=c(1998,1), deltat=1/4) erate$ITerate<-ts(data[nrow(data):1,"T,Y_GE15,TOTAL,IT"], start=c(1998,1), deltat=1/4) erate$NLerate<-ts(data[nrow(data):1,"T,Y_GE15,TOTAL,NL"], start=c(1998,1), deltat=1/4) erate$DEerate<-gsub('b','',erate$DEerate) erate$FRerate<-gsub('b','',erate$FRerate) erate$UKerate<-gsub('b','',erate$UKerate) erate$ESerate<-gsub('b','',erate$ESerate) erate$ITerate<-gsub('b','',erate$ITerate) erate$NLerate<-gsub('b','',erate$NLerate) #Get Employment/Population Ratio for US USerate <- ts(read.fwf("http://research.stlouisfed.org/fred2/data/EMRATIO.txt",skip=19,widths=c(10,6),header=FALSE, col.names=c("date","value"))[,2], start=c(1948,1), deltat=1/12) USerate <- aggregate(USerate, ndeltat=1/4, FUN=mean) USerate.08 <- as.numeric(window(USerate, start=c(2008,1),end=NULL)) USerate.08 <- ts((USerate.08-USerate.08[1]), start=1) #Employment Popoulation Ratios (computed) rm(epr) epr <- data.frame(DEepr=ts(as.numeric(labor.15.64$DEemp)*100/as.numeric(pop.15.64$DEpop), start=c(1992), deltat=1/4)) epr$FRepr <- ts(as.numeric(labor.15.64$FRemp)*100/as.numeric(pop.15.64$FRpop), start=c(1992), deltat=1/4) epr$UKepr <- ts(as.numeric(labor.15.64$UKemp)*100/as.numeric(pop.15.64$UKpop), start=c(1992), deltat=1/4) epr$ESepr <- ts(as.numeric(labor.15.64$ESemp)*100/as.numeric(pop.15.64$ESpop), start=c(1992), deltat=1/4) epr$ITepr <- ts(as.numeric(labor.15.64$ITemp)*100/as.numeric(pop.15.64$ITpop), start=c(1992), deltat=1/4) epr$NLepr <- ts(as.numeric(labor.15.64$NLemp)*100/as.numeric(pop.15.64$NLpop), start=c(1992), deltat=1/4) #Compute percentage change from previous peak attach(labor, pos=2) n <- dim(labor)[2] for(i in 1:n){ name <- paste(colnames(labor)[i],"08",sep=".") assn <- as.numeric(window(get(colnames(labor)[i]),start=c(2008,1),end=NULL)) assign(name, ts((assn/assn[1] -1)*100, start=1)) } detach(labor, pos=2) attach(labor.15.64, pos=2) n <- dim(labor.15.64)[2] for(i in 1:n){ name <- paste(colnames(labor.15.64)[i],"08",sep=".") assn <- as.numeric(window(get(colnames(labor.15.64)[i]),start=c(2008,1),end=NULL)) assign(name, ts((assn/assn[1] -1)*100, start=1)) } detach(labor.15.64, pos=2) attach(pop, pos=2) n <- dim(pop)[2] for(i in 1:n){ name <- paste(colnames(pop)[i],"08",sep=".") assn <- as.numeric(window(get(colnames(pop)[i]),start=c(2008,1),end=NULL)) assign(name, ts((assn/assn[1] -1)*100, start=1)) } detach(pop, pos=2) attach(pop.15.64, pos=2) n <- dim(pop.15.64)[2] for(i in 1:n){ name <- paste(colnames(pop.15.64)[i],"08",sep=".") assn <- as.numeric(window(get(colnames(pop.15.64)[i]),start=c(2008,1),end=NULL)) assign(name, ts((assn/assn[1] -1)*100, start=1)) } detach(pop.15.64, pos=2) attach(hours, pos=2) n <- dim(hours)[2] for(i in 1:n){ name <- paste(colnames(hours)[i],"08",sep=".") assn <- as.numeric(window(get(colnames(hours)[i]),start=c(2008,1),end=NULL)) assign(name, ts((assn/assn[1] -1)*100, start=1)) } detach(hours, pos=2) #################################################### #Compute absolute change from peak attach(unemp, pos=2) n <- dim(unemp)[2] for(i in 1:n){ name <- paste(colnames(unemp)[i],"08",sep=".") assn <- as.numeric(window(get(colnames(unemp)[i]),start=c(2008,1),end=NULL)) assign(name, ts((assn-assn[1]), start=1)) } detach(unemp, pos=2) attach(lturate, pos=2) n <- dim(lturate)[2] for(i in 1:n){ name <- paste(colnames(lturate)[i],"08",sep=".") assn <- as.numeric(window(get(colnames(lturate)[i]),start=c(2008,1),end=NULL)) assign(name, ts((assn-assn[1]), start=1)) } detach(lturate, pos=2) attach(lfp.15.64, pos=2) n <- dim(lfp.15.64)[2] for(i in 1:n){ name <- paste(colnames(lfp.15.64)[i],"08",sep=".") assn <- as.numeric(window(get(colnames(lfp.15.64)[i]),start=c(2008,1),end=NULL)) assign(name, ts((assn-assn[1]), start=1)) } detach(lfp.15.64, pos=2) attach(lfp.female, pos=2) n <- dim(lfp.female)[2] for(i in 1:n){ name <- paste(colnames(lfp.female)[i],"08",sep=".") assn <- as.numeric(window(get(colnames(lfp.female)[i]),start=c(2008,1),end=NULL)) assign(name, ts((assn-assn[1]), start=1)) } detach(lfp.female, pos=2) attach(epr, pos=2) n <- dim(epr)[2] for(i in 1:n){ name <- paste(colnames(epr)[i],"08",sep=".") assn <- as.numeric(window(get(colnames(epr)[i]),start=c(2008,1),end=NULL)) assign(name, ts((assn-assn[1]), start=1)) } detach(epr, pos=2) attach(erate, pos=2) n <- dim(erate)[2] for(i in 1:n){ name <- paste(colnames(erate)[i],"08",sep=".") assn <- as.numeric(window(get(colnames(erate)[i]),start=c(2008,1),end=NULL)) assign(name, ts((assn-assn[1]), start=1)) } detach(erate, pos=2) #Beveridge Curves #Download Unemployment Rates - Quarterly rm(data) temp <- tempfile() download.file("http://epp.eurostat.ec.europa.eu/NavTree_prod/everybody/BulkDownloadListing?sort=1&file=data%2Fune_rt_q.tsv.gz",temp) data <- read.delim(gzfile(temp), header=FALSE, row.names=1, stringsAsFactors=FALSE, na.strings=": ") data<-t(data) unlink(temp) #Unemployment Rates - Quarterly rm(urate.q) urate.q<-data.frame(row.names=data[,"s_adj,age,sex,geo\\time"]) urate.q$DEurate.q<-ts(data[nrow(data):1,"SA,TOTAL,T,DE"], start=c(1983,1), deltat=1/4) urate.q$FRurate.q<-ts(data[nrow(data):1,"SA,TOTAL,T,FR"], start=c(1983,1), deltat=1/4) urate.q$UKurate.q<-ts(data[nrow(data):1,"SA,TOTAL,T,UK"], start=c(1983,1), deltat=1/4) urate.q$ESurate.q<-ts(data[nrow(data):1,"SA,TOTAL,T,ES"], start=c(1983,1), deltat=1/4) urate.q$ITurate.q<-ts(data[nrow(data):1,"SA,TOTAL,T,IT"], start=c(1983,1), deltat=1/4) urate.q$NLurate.q<-ts(data[nrow(data):1,"SA,TOTAL,T,NL"], start=c(1983,1), deltat=1/4) urate.q$DEurate.q<-gsub('b','',urate.q$DEurate.q) urate.q$FRurate.q<-gsub('b','',urate.q$FRurate.q) urate.q$UKurate.q<-gsub('b','',urate.q$UKurate.q) urate.q$ESurate.q<-gsub('b','',urate.q$ESurate.q) urate.q$ITurate.q<-gsub('b','',urate.q$ITurate.q) urate.q$NLurate.q<-gsub('b','',urate.q$NLurate.q) #Beveridge Curves #Download Vacancy Rates - Quarterly rm(data) temp <- tempfile() download.file("http://epp.eurostat.ec.europa.eu/NavTree_prod/everybody/BulkDownloadListing?sort=1&file=data%2Fjvs_q_nace2.tsv.gz",temp) data <- read.delim(gzfile(temp), header=FALSE, row.names=1, stringsAsFactors=FALSE, na.strings=": ") data<-t(data) unlink(temp) #Vacancy Rates - Quarterly rm(vac) vac<-data.frame(row.names=data[,"s_adj,nace_r2,sizeclas,indic_em,geo\\time"]) vac$DEvac<-ts(data[nrow(data):1,"NSA,B-S,TOTAL,JOBRATE,DE"], start=c(2001,1), deltat=1/4) vac$UKvac<-ts(data[nrow(data):1,"NSA,B-S,TOTAL,JOBRATE,UK"], start=c(2001,1), deltat=1/4) vac$ESvac<-ts(data[nrow(data):1,"NSA,B-S,TOTAL,JOBRATE,ES"], start=c(2001,1), deltat=1/4) vac$NLvac<-ts(data[nrow(data):1,"NSA,B-S,TOTAL,JOBRATE,NL"], start=c(2001,1), deltat=1/4) vac$DEvac<-gsub('b','',vac$DEvac) vac$UKvac<-gsub('b','',vac$UKvac) vac$ESvac<-gsub('b','',vac$ESvac) vac$NLvac<-gsub('b','',vac$NLvac) vac$DEvac<-gsub('p','',vac$DEvac) vac$UKvac<-gsub('p','',vac$UKvac) vac$ESvac<-gsub('p','',vac$ESvac) vac$NLvac<-gsub('p','',vac$NLvac) vac$DEvac<-gsub('c','',vac$DEvac) vac$UKvac<-gsub('c','',vac$UKvac) vac$ESvac<-gsub('c','',vac$ESvac) vac$NLvac<-gsub('c','',vac$NLvac) vac$DEvac<-gsub('i','',vac$DEvac) vac$UKvac<-gsub('i','',vac$UKvac) vac$ESvac<-gsub('i','',vac$ESvac) vac$NLvac<-gsub('i','',vac$NLvac) vac$ESvac<-gsub(': ','',vac$ESvac) #Truncate Unemployment UKurate <- window(urate.q$UKurate.q,start=c(2001,2),end=NULL) NLurate <- window(urate.q$NLurate.q,start=c(2001,1),end=NULL) DEurate <- window(urate.q$DEurate.q,start=c(2009,4),end=NULL) ESurate <- window(urate.q$ESurate.q,start=c(2009,1),end=NULL) UKvac <- window(vac$UKvac,start=c(2001,2),end=NULL) NLvac <- window(vac$NLvac,start=c(2001,1),end=NULL) DEvac <- window(vac$DEvac,start=c(2009,4),end=NULL) ESvac <- window(vac$ESvac,start=c(2009,1),end=NULL) #Drop years not available in the other time series if(is.na(UKurate[length(UKurate)])==TRUE){ UKurate <- ts(UKurate[1:(length(UKurate)-1)], start=c(2001,2),deltat=1/4) UKvac <- ts(UKvac[1:(length(UKvac)-1)], start=c(2001,2), deltat=1/4) } if(is.na(NLurate[length(NLurate)])==TRUE){ NLurate <- NLurate[1:(length(NLurate)-1)] NLvac <- NLvac[1:(length(NLvac)-1)] } if(is.na(DEurate[length(DEurate)])==TRUE){ DEurate <- DEurate[1:(length(DEurate)-1)] UKvac <- UKvac[1:(length(UKvac)-1)] } if(is.na(ESurate[length(ESurate)])==TRUE){ ESurate <- ESurate[1:(length(ESurate)-1)] UKvac <- UKvac[1:(length(UKvac)-1)] } #Graphs ############################################################### #Employment - LFS plot(UKemp.08, main="Total Employment - Labour Force Survey", ylab="", xlab="Quarters from 2008 peak", col="white", type="l", lwd=2, axes=FALSE, yaxs="i", xaxs="i", tck=1, bty="l", family="Times", ylim=c(min(as.numeric(ESemp.08), as.numeric(ITemp.08), as.numeric(UKemp.08), as.numeric(DEemp.08), as.numeric(FRemp.08), as.numeric(NLemp.08), na.rm=TRUE)-1,max(as.numeric(ESemp.08), as.numeric(ITemp.08), as.numeric(UKemp.08), as.numeric(DEemp.08), as.numeric(FRemp.08), as.numeric(NLemp.08), na.rm=TRUE)+1)) axis(2, tick=TRUE, tck=1, lwd.ticks=.1, col.ticks="grey") axis(1, tick=TRUE, las=1, at=c(seq(0,35,4))) abline(h=0) lines(DEemp.08,col="darkgreen",lwd=2) lines(FRemp.08,col="orange3",lwd=2) lines(UKemp.08,col="red",lwd=2) lines(ESemp.08,col="orangered4",lwd=2) lines(ITemp.08,col="aquamarine4", lwd=2) lines(NLemp.08, col="purple4", lwd=2) box() legend("bottomleft", c("Germany","France","United Kingdom","Spain", "Italy", "Netherlands"), col=c("darkgreen","orange3","red","orangered4", "aquamarine4", "purple4"), lwd=c(2,2,2,2,2,2), lty=c(1,1,1,1,1,1), inset=.02, cex=.75, bg="gray87") mtext("Percentage change from 2008 peak, Resident Population Concept", side = 3, line=0.5, cex = 1) mtext("Cooley-Rupert European Economic Snapshot; www.europeansnapshot.com", side = 4, line= 0, cex = .7, adj = 0) mtext("Source: Eurostat", side = 4, line= 1, cex = .7, adj = 0) dev.copy2pdf(file=paste("ALL-empch-",Sys.Date(),".pdf", sep=""), width=8, height=6, pointsize=12) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),"/png",sep="")) dev.print(png, file=paste("ALL-empch-",Sys.Date(),".png", sep=""), pointsize=12, width=8, height=6, units="in", bg="white", res=400) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),sep="")) ############################################################### #Employment - National Accounts plot(UKemp2.08, main="Total Employment - National Accounts", ylab="", xlab="Quarters from 2008 peak", col="white", type="l", lwd=2, axes=FALSE, yaxs="i", xaxs="i", tck=1, bty="l", family="Times", ylim=c(min(as.numeric(ESemp2.08), as.numeric(ITemp2.08), as.numeric(UKemp2.08), as.numeric(DEemp2.08), as.numeric(FRemp2.08), as.numeric(NLemp2.08), na.rm=TRUE)-1,max(as.numeric(ESemp2.08), as.numeric(ITemp2.08), as.numeric(UKemp2.08), as.numeric(DEemp2.08), as.numeric(FRemp2.08), as.numeric(NLemp2.08), na.rm=TRUE)+1)) axis(2, tick=TRUE, tck=1, lwd.ticks=.1, col.ticks="grey") axis(1, tick=TRUE, las=1, at=c(seq(0,35,4))) abline(h=0) lines(DEemp2.08,col="darkgreen",lwd=2) lines(FRemp2.08,col="orange3",lwd=2) lines(UKemp2.08,col="red",lwd=2) lines(ESemp2.08,col="orangered4",lwd=2) lines(ITemp2.08,col="aquamarine4", lwd=2) lines(NLemp2.08, col="purple4", lwd=2) box() legend("bottomleft", c("Germany","France","United Kingdom","Spain", "Italy", "Netherlands"), col=c("darkgreen","orange3","red","orangered4", "aquamarine4", "purple4"), lwd=c(2,2,2,2,2,2), lty=c(1,1,1,1,1,1), inset=.02, cex=.75, bg="gray87") mtext("Percentage change from 2008 peak, Domestic Concept", side = 3, line=0.5, cex = 1) mtext("Cooley-Rupert European Economic Snapshot; www.europeansnapshot.com", side = 4, line= 0, cex = .7, adj = 0) mtext("Source: Eurostat", side = 4, line= 1, cex = .7, adj = 0) dev.copy2pdf(file=paste("ALL-emp2ch-",Sys.Date(),".pdf", sep=""), width=8, height=6, pointsize=12) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),"/png",sep="")) dev.print(png, file=paste("ALL-emp2ch-",Sys.Date(),".png", sep=""), pointsize=12, width=8, height=6, units="in", bg="white", res=400) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),sep="")) ############################################################### #Unemployment Rate plot(UKunemp.08, main="Unemployment Rate", ylab="", xlab="Months from 2008 peak", col="white", type="l", lwd=2, axes=FALSE, yaxs="i", xaxs="i", tck=1, bty="l", family="Times", ylim=c(min(as.numeric(ESunemp.08), as.numeric(ITunemp.08), as.numeric(UKunemp.08), as.numeric(DEunemp.08), as.numeric(FRunemp.08), as.numeric(NLunemp.08), na.rm=TRUE)-1,max(as.numeric(ESunemp.08), as.numeric(ITunemp.08), as.numeric(UKunemp.08), as.numeric(DEunemp.08), as.numeric(FRunemp.08), as.numeric(NLunemp.08), na.rm=TRUE)+1)) axis(2, tick=TRUE, tck=1, lwd.ticks=.1, col.ticks="grey") axis(1, tick=TRUE, las=1, at=c(seq(0,120,6))) abline(h=0) lines(DEunemp.08,col="darkgreen",lwd=2) lines(FRunemp.08,col="orange3",lwd=2) lines(UKunemp.08,col="red",lwd=2) lines(ESunemp.08,col="orangered4",lwd=2) lines(ITunemp.08,col="aquamarine4", lwd=2) lines(NLunemp.08, col="purple4", lwd=2) box() legend("topleft", c("Germany","France","United Kingdom","Spain", "Italy", "Netherlands"), col=c("darkgreen","orange3","red","orangered4", "aquamarine4", "purple4"), lwd=c(2,2,2,2,2,2), lty=c(1,1,1,1,1,1), inset=.02, cex=.75, bg="gray87") mtext("Percentage point change from 2008 peak, Seasonally Adjusted ", side = 3, line=0.5, cex = 1) mtext("Cooley-Rupert European Economic Snapshot; www.europeansnapshot.com", side = 4, line= 0, cex = .7, adj = 0) mtext("Source: Eurostat", side = 4, line= 1, cex = .7, adj = 0) dev.copy2pdf(file=paste("ALL-unempch-",Sys.Date(),".pdf", sep=""), width=8, height=6, pointsize=12) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),"/png",sep="")) dev.print(png, file=paste("ALL-unempch-",Sys.Date(),".png", sep=""), pointsize=12, width=8, height=6, units="in", bg="white", res=400) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),sep="")) ############################################################### #Unemployment Rate - US plot(UKunemp.08, main="Unemployment Rate", ylab="", xlab="Months from 2008 peak", col="white", type="l", lwd=2, axes=FALSE, yaxs="i", xaxs="i", tck=1, bty="l", family="Times", ylim=c(min(as.numeric(ESunemp.08), as.numeric(ITunemp.08), as.numeric(UKunemp.08), as.numeric(DEunemp.08), as.numeric(FRunemp.08), as.numeric(NLunemp.08),as.numeric(USunemp.08), na.rm=TRUE)-1,max(as.numeric(ESunemp.08), as.numeric(ITunemp.08), as.numeric(UKunemp.08), as.numeric(DEunemp.08), as.numeric(FRunemp.08), as.numeric(NLunemp.08),as.numeric(USunemp.08), na.rm=TRUE)+1)) axis(2, tick=TRUE, tck=1, lwd.ticks=.1, col.ticks="grey") axis(1, tick=TRUE, las=1, at=c(seq(0,120,6))) abline(h=0) lines(DEunemp.08,col="darkgreen",lwd=2) lines(FRunemp.08,col="orange3",lwd=2) lines(UKunemp.08,col="red",lwd=2) lines(ESunemp.08,col="orangered4",lwd=2) lines(ITunemp.08,col="aquamarine4", lwd=2) lines(NLunemp.08, col="purple4", lwd=2) lines(USunemp.08, col="mediumblue", lwd=4) box() legend("topleft", c("Germany","France","United Kingdom","Spain", "Italy", "Netherlands", "United States"), col=c("darkgreen","orange3","red","orangered4", "aquamarine4", "purple4","mediumblue"), lwd=c(2,2,2,2,2,2,2), lty=c(1,1,1,1,1,1,1), inset=.02, cex=.75, bg="gray87") mtext("Percentage point change from 2008 peak, Seasonally Adjusted ", side = 3, line=0.5, cex = 1) mtext("Cooley-Rupert European Economic Snapshot; www.europeansnapshot.com", side = 4, line= 0, cex = .7, adj = 0) mtext("Source: Eurostat", side = 4, line= 1, cex = .7, adj = 0) dev.copy2pdf(file=paste("US-unempch-",Sys.Date(),".pdf", sep=""), width=8, height=6, pointsize=12) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),"/png",sep="")) dev.print(png, file=paste("US-unempch-",Sys.Date(),".png", sep=""), pointsize=12, width=8, height=6, units="in", bg="white", res=400) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),sep="")) ############################################################### #Unemployment Rate - Level attach(unemp, pos=2) plot(UKunemp, main="Unemployment Rate - Level", ylab="", xlab="Year", col="white", type="l", lwd=2, bty="l", family="Times", ylim=c(min(as.numeric(ESunemp), as.numeric(ITunemp), as.numeric(UKunemp), as.numeric(DEunemp), as.numeric(FRunemp), as.numeric(NLunemp), na.rm=TRUE)-1,max(as.numeric(ESunemp), as.numeric(ITunemp), as.numeric(UKunemp), as.numeric(DEunemp), as.numeric(FRunemp), as.numeric(NLunemp), na.rm=TRUE)+1)) lines(DEunemp,col="darkgreen",lwd=2) lines(FRunemp,col="orange3",lwd=2) lines(UKunemp,col="red",lwd=2) lines(ESunemp,col="orangered4",lwd=2) lines(ITunemp,col="aquamarine4", lwd=2) lines(NLunemp, col="purple4", lwd=2) box() legend("topleft", c("Germany","France","United Kingdom","Spain", "Italy", "Netherlands"), col=c("darkgreen","orange3","red","orangered4", "aquamarine4", "purple4"), lwd=c(2,2,2,2,2,2), lty=c(1,1,1,1,1,1), inset=.02, cex=.75, bg="gray87") mtext("Seasonally Adjusted", side = 3, line=0.5, cex = 1) mtext("Cooley-Rupert European Economic Snapshot; www.europeansnapshot.com", side = 4, line= 0, cex = .7, adj = 0) mtext("Source: Eurostat", side = 4, line= 1, cex = .7, adj = 0) dev.copy2pdf(file=paste("ALL-unemp-",Sys.Date(),".pdf", sep=""), width=8, height=6, pointsize=12) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),"/png",sep="")) dev.print(png, file=paste("ALL-unemp-",Sys.Date(),".png", sep=""), pointsize=12, width=8, height=6, units="in", bg="white", res=400) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),sep="")) detach(unemp, pos=2) ############################################################### #Long-term Unemployment Rate plot(UKlturate.08, main="Long-term Unemployment Rate", ylab="", xlab="Quarters from 2008 peak", col="white", type="l", lwd=2, axes=FALSE, yaxs="i", xaxs="i", tck=1, bty="l", family="Times", ylim=c(min(as.numeric(ESlturate.08), as.numeric(ITlturate.08), as.numeric(UKlturate.08), as.numeric(DElturate.08), as.numeric(FRlturate.08), as.numeric(NLlturate.08), na.rm=TRUE)-1,max(as.numeric(ESlturate.08), as.numeric(ITlturate.08), as.numeric(UKlturate.08), as.numeric(DElturate.08), as.numeric(FRlturate.08), as.numeric(NLlturate.08), na.rm=TRUE)+1)) axis(2, tick=TRUE, tck=1, lwd.ticks=.1, col.ticks="grey") axis(1, tick=TRUE, las=1, at=c(seq(0,35,4))) abline(h=0) lines(DElturate.08,col="darkgreen",lwd=2) lines(FRlturate.08,col="orange3",lwd=2) lines(UKlturate.08,col="red",lwd=2) lines(ESlturate.08,col="orangered4",lwd=2) lines(ITlturate.08,col="aquamarine4", lwd=2) lines(NLlturate.08, col="purple4", lwd=2) box() legend("topleft", c("Germany","France","United Kingdom","Spain", "Italy", "Netherlands"), col=c("darkgreen","orange3","red","orangered4", "aquamarine4", "purple4"), lwd=c(2,2,2,2,2,2), lty=c(1,1,1,1,1,1), inset=.02, cex=.75, bg="gray87") mtext("Percentage point change from 2008 peak, Unemployed for over 12 months", side = 3, line=0.5, cex = 1) mtext("Cooley-Rupert European Economic Snapshot; www.europeansnapshot.com", side = 4, line= 0, cex = .7, adj = 0) mtext("Source: Eurostat", side = 4, line= 1, cex = .7, adj = 0) dev.copy2pdf(file=paste("ALL-lturatech-",Sys.Date(),".pdf", sep=""), width=8, height=6, pointsize=12) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),"/png",sep="")) dev.print(png, file=paste("ALL-lturatech-",Sys.Date(),".png", sep=""), pointsize=12, width=8, height=6, units="in", bg="white", res=400) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),sep="")) ############################################################### #Labor Force Participation - ages 15-64 plot(UKlfp.15.64.08, main="Labor Force Participation Rate (Ages 15-64)", ylab="", xlab="Quarters from 2008 peak", col="white", type="l", lwd=2, axes=FALSE, yaxs="i", xaxs="i", tck=1, bty="l", family="Times", ylim=c(min(as.numeric(ESlfp.15.64.08), as.numeric(ITlfp.15.64.08), as.numeric(UKlfp.15.64.08), as.numeric(DElfp.15.64.08), as.numeric(FRlfp.15.64.08), as.numeric(NLlfp.15.64.08), na.rm=TRUE)-1,max(as.numeric(ESlfp.15.64.08), as.numeric(ITlfp.15.64.08), as.numeric(UKlfp.15.64.08), as.numeric(DElfp.15.64.08), as.numeric(FRlfp.15.64.08), as.numeric(NLlfp.15.64.08), na.rm=TRUE)+1)) axis(2, tick=TRUE, tck=1, lwd.ticks=.1, col.ticks="grey") axis(1, tick=TRUE, las=1, at=c(seq(0,35,4))) abline(h=0) lines(DElfp.15.64.08,col="darkgreen",lwd=2) lines(FRlfp.15.64.08,col="orange3",lwd=2) lines(UKlfp.15.64.08,col="red",lwd=2) lines(ESlfp.15.64.08,col="orangered4",lwd=2) lines(ITlfp.15.64.08,col="aquamarine4", lwd=2) lines(NLlfp.15.64.08, col="purple4", lwd=2) box() legend("topleft", c("Germany","France","United Kingdom","Spain", "Italy", "Netherlands"), col=c("darkgreen","orange3","red","orangered4", "aquamarine4", "purple4"), lwd=c(2,2,2,2,2,2), lty=c(1,1,1,1,1,1), inset=.02, cex=.75, bg="gray87") mtext("Percentage point change from 2008 peak", side = 3, line=0.5, cex = 1) mtext("Cooley-Rupert European Economic Snapshot; www.europeansnapshot.com", side = 4, line= 0, cex = .7, adj = 0) mtext("Source: Eurostat", side = 4, line= 1, cex = .7, adj = 0) dev.copy2pdf(file=paste("ALL-lfpch-",Sys.Date(),".pdf", sep=""), width=8, height=6, pointsize=12) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),"/png",sep="")) dev.print(png, file=paste("ALL-lfpch-",Sys.Date(),".png", sep=""), pointsize=12, width=8, height=6, units="in", bg="white", res=400) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),sep="")) ############################################################### #Labor Force Participation - ages 15-64 - Level attach(lfp.15.64, pos=2) plot(UKlfp.15.64, main="Labor Force Participation Rate (Ages 15-64)", ylab="", xlab="Year", col="white", type="l", lwd=2, bty="l", family="Times", ylim=c(min(as.numeric(ESlfp.15.64), as.numeric(ITlfp.15.64), as.numeric(UKlfp.15.64), as.numeric(DElfp.15.64), as.numeric(FRlfp.15.64), as.numeric(NLlfp.15.64), na.rm=TRUE)-1,max(as.numeric(ESlfp.15.64), as.numeric(ITlfp.15.64), as.numeric(UKlfp.15.64), as.numeric(DElfp.15.64), as.numeric(FRlfp.15.64), as.numeric(NLlfp.15.64), na.rm=TRUE)+1)) lines(DElfp.15.64,col="darkgreen",lwd=2) lines(FRlfp.15.64,col="orange3",lwd=2) lines(UKlfp.15.64,col="red",lwd=2) lines(ESlfp.15.64,col="orangered4",lwd=2) lines(ITlfp.15.64,col="aquamarine4", lwd=2) lines(NLlfp.15.64, col="purple4", lwd=2) box() legend("topleft", c("Germany","France","United Kingdom","Spain", "Italy", "Netherlands"), col=c("darkgreen","orange3","red","orangered4", "aquamarine4", "purple4"), lwd=c(2,2,2,2,2,2), lty=c(1,1,1,1,1,1), inset=.02, cex=.75, bg="gray87") mtext("Cooley-Rupert European Economic Snapshot; www.europeansnapshot.com", side = 4, line= 0, cex = .7, adj = 0) mtext("Source: Eurostat", side = 4, line= 1, cex = .7, adj = 0) dev.copy2pdf(file=paste("ALL-lfp-",Sys.Date(),".pdf", sep=""), width=8, height=6, pointsize=12) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),"/png",sep="")) dev.print(png, file=paste("ALL-lfp-",Sys.Date(),".png", sep=""), pointsize=12, width=8, height=6, units="in", bg="white", res=400) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),sep="")) detach(lfp.15.64, pos=2) ############################################################### #Female Labor Force Participation - ages 15-64 plot(UKlfp.female.08, main="Female Labor Force Participation Rate (Ages 15-64)", ylab="", xlab="Quarters from 2008 peak", col="white", type="l", lwd=2, axes=FALSE, yaxs="i", xaxs="i", tck=1, bty="l", family="Times", ylim=c(min(as.numeric(ESlfp.female.08), as.numeric(ITlfp.female.08), as.numeric(UKlfp.female.08), as.numeric(DElfp.female.08), as.numeric(FRlfp.female.08), as.numeric(NLlfp.female.08), na.rm=TRUE)-1,max(as.numeric(ESlfp.female.08), as.numeric(ITlfp.female.08), as.numeric(UKlfp.female.08), as.numeric(DElfp.female.08), as.numeric(FRlfp.female.08), as.numeric(NLlfp.female.08), na.rm=TRUE)+1)) axis(2, tick=TRUE, tck=1, lwd.ticks=.1, col.ticks="grey") axis(1, tick=TRUE, las=1, at=c(seq(0,35,4))) abline(h=0) lines(DElfp.female.08,col="darkgreen",lwd=2) lines(FRlfp.female.08,col="orange3",lwd=2) lines(UKlfp.female.08,col="red",lwd=2) lines(ESlfp.female.08,col="orangered4",lwd=2) lines(ITlfp.female.08,col="aquamarine4", lwd=2) lines(NLlfp.female.08, col="purple4", lwd=2) box() legend("topleft", c("Germany","France","United Kingdom","Spain", "Italy", "Netherlands"), col=c("darkgreen","orange3","red","orangered4", "aquamarine4", "purple4"), lwd=c(2,2,2,2,2,2), lty=c(1,1,1,1,1,1), inset=.02, cex=.75, bg="gray87") mtext("Percentage point change from 2008 peak", side = 3, line=0.5, cex = 1) mtext("Cooley-Rupert European Economic Snapshot; www.europeansnapshot.com", side = 4, line= 0, cex = .7, adj = 0) mtext("Source: Eurostat", side = 4, line= 1, cex = .7, adj = 0) dev.copy2pdf(file=paste("ALL-lfp-female-ch-",Sys.Date(),".pdf", sep=""), width=8, height=6, pointsize=12) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),"/png",sep="")) dev.print(png, file=paste("ALL-lfp-female-ch-",Sys.Date(),".png", sep=""), pointsize=12, width=8, height=6, units="in", bg="white", res=400) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),sep="")) ############################################################### #Female Labor Force Participation - ages 15-64 - Level attach(lfp.female,pos=2) plot(UKlfp.female, main="Female Labor Force Participation Rate (Ages 15-64)", ylab="", xlab="Year", col="white", type="l", lwd=2, bty="l", family="Times", ylim=c(min(as.numeric(ESlfp.female), as.numeric(ITlfp.female), as.numeric(UKlfp.female), as.numeric(DElfp.female), as.numeric(FRlfp.female), as.numeric(NLlfp.female), na.rm=TRUE)-1,max(as.numeric(ESlfp.female), as.numeric(ITlfp.female), as.numeric(UKlfp.female), as.numeric(DElfp.female), as.numeric(FRlfp.female), as.numeric(NLlfp.female), na.rm=TRUE)+1)) lines(DElfp.female,col="darkgreen",lwd=2) lines(FRlfp.female,col="orange3",lwd=2) lines(UKlfp.female,col="red",lwd=2) lines(ESlfp.female,col="orangered4",lwd=2) lines(ITlfp.female,col="aquamarine4", lwd=2) lines(NLlfp.female, col="purple4", lwd=2) box() legend("topleft", c("Germany","France","United Kingdom","Spain", "Italy", "Netherlands"), col=c("darkgreen","orange3","red","orangered4", "aquamarine4", "purple4"), lwd=c(2,2,2,2,2,2), lty=c(1,1,1,1,1,1), inset=.02, cex=.75, bg="gray87") mtext("Cooley-Rupert European Economic Snapshot; www.europeansnapshot.com", side = 4, line= 0, cex = .7, adj = 0) mtext("Source: Eurostat", side = 4, line= 1, cex = .7, adj = 0) dev.copy2pdf(file=paste("ALL-lfp-female-",Sys.Date(),".pdf", sep=""), width=8, height=6, pointsize=12) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),"/png",sep="")) dev.print(png, file=paste("ALL-lfp-female-",Sys.Date(),".png", sep=""), pointsize=12, width=8, height=6, units="in", bg="white", res=400) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),sep="")) detach(lfp.female,pos=2) ############################################################### #Employment Population Ratio - Ages 15 to 64 plot(UKepr.08, main="Employment Population Ratio (Ages 15-64)", ylab="", xlab="Quarters from 2008 peak", col="white", type="l", lwd=2, axes=FALSE, yaxs="i", xaxs="i", tck=1, bty="l", family="Times", ylim=c(min(as.numeric(ESepr.08), as.numeric(ITepr.08), as.numeric(UKepr.08), as.numeric(DEepr.08), as.numeric(FRepr.08), as.numeric(NLepr.08), na.rm=TRUE)-1,max(as.numeric(ESepr.08), as.numeric(ITepr.08), as.numeric(UKepr.08), as.numeric(DEepr.08), as.numeric(FRepr.08), as.numeric(NLepr.08), na.rm=TRUE)+1)) axis(2, tick=TRUE, tck=1, lwd.ticks=.1, col.ticks="grey") axis(1, tick=TRUE, las=1, at=c(seq(0,35,4))) abline(h=0) lines(DEepr.08,col="darkgreen",lwd=2) lines(FRepr.08,col="orange3",lwd=2) lines(UKepr.08,col="red",lwd=2) lines(ESepr.08,col="orangered4",lwd=2) lines(ITepr.08,col="aquamarine4", lwd=2) lines(NLepr.08, col="purple4", lwd=2) box() legend("topleft", c("Germany","France","United Kingdom","Spain", "Italy", "Netherlands"), col=c("darkgreen","orange3","red","orangered4", "aquamarine4", "purple4"), lwd=c(2,2,2,2,2,2), lty=c(1,1,1,1,1,1), inset=.02, cex=.75, bg="gray87") mtext("Percentage point change from 2008 peak, Resident Population Concept", side = 3, line=0.5, cex = 1) mtext("Cooley-Rupert European Economic Snapshot; www.europeansnapshot.com", side = 4, line= 0, cex = .7, adj = 0) mtext("Source: Eurostat", side = 4, line= 1, cex = .7, adj = 0) dev.copy2pdf(file=paste("ALL-eprch-",Sys.Date(),".pdf", sep=""), width=8, height=6, pointsize=12) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),"/png",sep="")) dev.print(png, file=paste("ALL-eprch-",Sys.Date(),".png", sep=""), pointsize=12, width=8, height=6, units="in", bg="white", res=400) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),sep="")) ############################################################### #Employment Population Ratio - Ages 15 to 64 - Level attach(epr,pos=2) plot(UKepr, main="Employment Population Ratio (Ages 15-64)", ylab="", xlab="Year", col="white", type="l", lwd=2, bty="l", family="Times", ylim=c(min(as.numeric(ESepr), as.numeric(ITepr), as.numeric(UKepr), as.numeric(DEepr), as.numeric(FRepr), as.numeric(NLepr), na.rm=TRUE)-1,max(as.numeric(ESepr), as.numeric(ITepr), as.numeric(UKepr), as.numeric(DEepr), as.numeric(FRepr), as.numeric(NLepr), na.rm=TRUE)+1)) lines(DEepr,col="darkgreen",lwd=2) lines(FRepr,col="orange3",lwd=2) lines(UKepr,col="red",lwd=2) lines(ESepr,col="orangered4",lwd=2) lines(ITepr,col="aquamarine4", lwd=2) lines(NLepr, col="purple4", lwd=2) box() legend("topleft", c("Germany","France","United Kingdom","Spain", "Italy", "Netherlands"), col=c("darkgreen","orange3","red","orangered4", "aquamarine4", "purple4"), lwd=c(2,2,2,2,2,2), lty=c(1,1,1,1,1,1), inset=.02, cex=.75, bg="gray87") mtext("Resident Population Concept", side = 3, line=0.5, cex = 1) mtext("Cooley-Rupert European Economic Snapshot; www.europeansnapshot.com", side = 4, line= 0, cex = .7, adj = 0) mtext("Source: Eurostat", side = 4, line= 1, cex = .7, adj = 0) dev.copy2pdf(file=paste("ALL-epr-",Sys.Date(),".pdf", sep=""), width=8, height=6, pointsize=12) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),"/png",sep="")) dev.print(png, file=paste("ALL-epr-",Sys.Date(),".png", sep=""), pointsize=12, width=8, height=6, units="in", bg="white", res=400) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),sep="")) detach(epr,pos=2) ############################################################### #Employment Population Ratio - Ages 15 and Older plot(UKerate.08, main="Employment Population Ratio (Ages 15+)", ylab="", xlab="Quarters from 2008 peak", col="white", type="l", lwd=2, axes=FALSE, yaxs="i", xaxs="i", tck=1, bty="l", family="Times", ylim=c(min(as.numeric(ESerate.08), as.numeric(ITerate.08), as.numeric(UKerate.08), as.numeric(DEerate.08), as.numeric(FRerate.08), as.numeric(NLerate.08), na.rm=TRUE)-1,max(as.numeric(ESerate.08), as.numeric(ITerate.08), as.numeric(UKerate.08), as.numeric(DEerate.08), as.numeric(FRerate.08), as.numeric(NLerate.08), na.rm=TRUE)+1)) axis(2, tick=TRUE, tck=1, lwd.ticks=.1, col.ticks="grey") axis(1, tick=TRUE, las=1, at=c(seq(0,35,4))) abline(h=0) lines(DEerate.08,col="darkgreen",lwd=2) lines(FRerate.08,col="orange3",lwd=2) lines(UKerate.08,col="red",lwd=2) lines(ESerate.08,col="orangered4",lwd=2) lines(ITerate.08,col="aquamarine4", lwd=2) lines(NLerate.08, col="purple4", lwd=2) box() legend("topleft", c("Germany","France","United Kingdom","Spain", "Italy", "Netherlands"), col=c("darkgreen","orange3","red","orangered4", "aquamarine4", "purple4"), lwd=c(2,2,2,2,2,2), lty=c(1,1,1,1,1,1), inset=.02, cex=.75, bg="gray87") mtext("Percentage point change from 2008 peak", side = 3, line=0.5, cex = 1) mtext("Cooley-Rupert European Economic Snapshot; www.europeansnapshot.com", side = 4, line= 0, cex = .7, adj = 0) mtext("Source: Eurostat", side = 4, line= 1, cex = .7, adj = 0) dev.copy2pdf(file=paste("ALL-eratech-",Sys.Date(),".pdf", sep=""), width=8, height=6, pointsize=12) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),"/png",sep="")) dev.print(png, file=paste("ALL-eratech-",Sys.Date(),".png", sep=""), pointsize=12, width=8, height=6, units="in", bg="white", res=400) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),sep="")) ############################################################### #Employment Population Ratio - Ages 15 and Older - US plot(UKerate.08, main="Employment Population Ratio (Ages 15+)", ylab="", xlab="Quarters from 2008 peak", col="white", type="l", lwd=2, axes=FALSE, yaxs="i", xaxs="i", tck=1, bty="l", family="Times", ylim=c(min(as.numeric(USerate.08), as.numeric(ESerate.08), as.numeric(ITerate.08), as.numeric(UKerate.08), as.numeric(DEerate.08), as.numeric(FRerate.08), as.numeric(NLerate.08), na.rm=TRUE)-1,max(as.numeric(USerate.08), as.numeric(ESerate.08), as.numeric(ITerate.08), as.numeric(UKerate.08), as.numeric(DEerate.08), as.numeric(FRerate.08), as.numeric(NLerate.08), na.rm=TRUE)+1)) axis(2, tick=TRUE, tck=1, lwd.ticks=.1, col.ticks="grey") axis(1, tick=TRUE, las=1, at=c(seq(0,35,4))) abline(h=0) lines(DEerate.08,col="darkgreen",lwd=2) lines(FRerate.08,col="orange3",lwd=2) lines(UKerate.08,col="red",lwd=2) lines(ESerate.08,col="orangered4",lwd=2) lines(ITerate.08,col="aquamarine4", lwd=2) lines(NLerate.08, col="purple4", lwd=2) lines(USerate.08, col="mediumblue", lwd=4) box() legend("topleft", c("Germany","France","United Kingdom","Spain", "Italy", "Netherlands", "United States"), col=c("darkgreen","orange3","red","orangered4", "aquamarine4", "purple4", "medium blue"), lwd=c(2,2,2,2,2,2,2), lty=c(1,1,1,1,1,1,1), inset=.02, cex=.75, bg="gray87") mtext("Percentage point change from 2008 peak", side = 3, line=0.5, cex = 1) mtext("Cooley-Rupert European Economic Snapshot; www.europeansnapshot.com", side = 4, line= 0, cex = .7, adj = 0) mtext("Source: Eurostat", side = 4, line= 1, cex = .7, adj = 0) dev.copy2pdf(file=paste("US-eratech-",Sys.Date(),".pdf", sep=""), width=8, height=6, pointsize=12) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),"/png",sep="")) dev.print(png, file=paste("US-eratech-",Sys.Date(),".png", sep=""), pointsize=12, width=8, height=6, units="in", bg="white", res=400) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),sep="")) ############################################################### #Hours Worked plot(UKhours.08, main="Average Number of Weekly Hours Worked", ylab="", xlab="Quarters from 2008 peak", col="white", type="l", lwd=2, axes=FALSE, yaxs="i", xaxs="i", tck=1, bty="l", family="Times", ylim=c(min(as.numeric(EShours.08), as.numeric(IThours.08), as.numeric(UKhours.08), as.numeric(DEhours.08), as.numeric(FRhours.08), as.numeric(NLhours.08), na.rm=TRUE)-1,max(as.numeric(EShours.08), as.numeric(IThours.08), as.numeric(UKhours.08), as.numeric(DEhours.08), as.numeric(FRhours.08), as.numeric(NLhours.08), na.rm=TRUE)+1)) axis(2, tick=TRUE, tck=1, lwd.ticks=.1, col.ticks="grey") axis(1, tick=TRUE, las=1, at=c(seq(0,35,4))) abline(h=0) lines(DEhours.08,col="darkgreen",lwd=2) lines(FRhours.08,col="orange3",lwd=2) lines(UKhours.08,col="red",lwd=2) lines(EShours.08,col="orangered4",lwd=2) lines(IThours.08,col="aquamarine4", lwd=2) lines(NLhours.08, col="purple4", lwd=2) box() legend("bottomleft", c("Germany","France","United Kingdom","Spain", "Italy", "Netherlands"), col=c("darkgreen","orange3","red","orangered4", "aquamarine4", "purple4"), lwd=c(2,2,2,2,2,2), lty=c(1,1,1,1,1,1), inset=.02, cex=.75, bg="gray87") mtext("Percentage change from 2008 peak", side = 3, line=0.5, cex = 1) mtext("Cooley-Rupert European Economic Snapshot; www.europeansnapshot.com", side = 4, line= 0, cex = .7, adj = 0) mtext("Source: Eurostat", side = 4, line= 1, cex = .7, adj = 0) dev.copy2pdf(file=paste("ALL-hoursch-",Sys.Date(),".pdf", sep=""), width=8, height=6, pointsize=12) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),"/png",sep="")) dev.print(png, file=paste("ALL-hoursch-",Sys.Date(),".png", sep=""), pointsize=12, width=8, height=6, units="in", bg="white", res=400) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),sep="")) ######################## #UK Beveridge Curve plot(UKurate, UKvac, type="o", main="U.K. Beveridge Curve", xlab="unemployment rate (percent)", ylab="vacancy rate (percent)", col="white", xy.labels=FALSE, yaxt="n", xaxt="n", tck=1, lwd=.9, pch=20, family="Times") axis(2, tick=TRUE, tck=1, lwd.ticks=.1, col.ticks="grey80") axis(1, tick=TRUE, tck=1, lwd.ticks=.1, col.ticks="grey80") points(UKurate, UKvac, type="o", col="mediumblue", lwd=.9, pch=20) points(window(UKurate,start=c(2008,1),end=NULL), window(UKvac,start=c(2008,1),end=NULL), col="red", type="o", pch=20, lwd=1.5) box() mtext("Source: Eurostat", side = 4, line= 1, cex = .7, adj = 0) mtext("Cooley-Rupert Economic Snapshot; www.europeansnapshot.com", side = 4, line= 0, cex = .7, adj = 0) mtext(paste("2001 Q2 - ",as.character(substr(time(UKurate)[length(UKurate)],1,4))," Q",as.character(cycle(UKurate[length(UKurate)])),sep=""), side = 3, line=0.5, cex = 1) legend("topright", paste("2008 Q1 - ",as.character(substr(time(UKurate)[length(UKurate)],1,4))," Q",as.character(cycle(UKurate[length(UKurate)])),sep=""), col="red", lwd=1.5, inset=.02) dev.copy2pdf(file=paste("UK-beveridge-",Sys.Date(),".pdf", sep=""), width=8, height=6, pointsize=12) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),"/png",sep="")) dev.print(png, file=paste("UK-beveridge-",Sys.Date(),".png", sep=""), pointsize=12, width=8, height=6, units="in", bg="white", res=400) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),sep="")) ######################## #Germany Beveridge Curve plot(DEurate, DEvac, type="o", main="German Beveridge Curve", xlab="unemployment rate (percent)", ylab="vacancy rate (percent)", col="blue", xy.labels=FALSE, yaxt="n", xaxt="n", tck=1, lwd=.9, pch=20, family="Times") axis(2, tick=TRUE, tck=1, lwd.ticks=.1, col.ticks="grey80") axis(1, tick=TRUE, tck=1, lwd.ticks=.1, col.ticks="grey80") points(DEurate, DEvac, type="o", col="mediumblue", lwd=.9, pch=20) points(window(DEurate,start=c(2008,1),end=NULL), window(DEvac,start=c(2008,1),end=NULL), col="red", type="o", pch=20, lwd=1.5) box() mtext("Source: Eurostat", side = 4, line= 1, cex = .7, adj = 0) mtext("Cooley-Rupert Economic Snapshot; www.europeansnapshot.com", side = 4, line= 0, cex = .7, adj = 0) mtext(paste("2009 Q4 - ",as.character(substr(time(DEurate)[length(DEurate)],1,4))," Q",as.character(cycle(DEurate[length(DEurate)])),sep=""), side = 3, line=0.5, cex = 1) dev.copy2pdf(file=paste("DE-beveridge-",Sys.Date(),".pdf", sep=""), width=8, height=6, pointsize=12) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),"/png",sep="")) dev.print(png, file=paste("DE-beveridge-",Sys.Date(),".png", sep=""), pointsize=12, width=8, height=6, units="in", bg="white", res=400) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),sep="")) ######################## #Netherlands Beveridge Curve plot(NLurate, NLvac, type="o", main="Netherlands Beveridge Curve", xlab="unemployment rate (percent)", ylab="vacancy rate (percent)", col="blue", xy.labels=FALSE, yaxt="n", xaxt="n", tck=1, lwd=.9, pch=20, family="Times") axis(2, tick=TRUE, tck=1, lwd.ticks=.1, col.ticks="grey80") axis(1, tick=TRUE, tck=1, lwd.ticks=.1, col.ticks="grey80") points(NLurate, NLvac, type="o", col="mediumblue", lwd=.9, pch=20) points(window(NLurate,start=c(2008,1),end=NULL), window(NLvac,start=c(2008,1),end=NULL), col="red", type="o", pch=20, lwd=1.5) box() mtext("Source: Eurostat", side = 4, line= 1, cex = .7, adj = 0) mtext("Cooley-Rupert Economic Snapshot; www.europeansnapshot.com", side = 4, line= 0, cex = .7, adj = 0) mtext(paste("2001 Q1 - ",as.character(substr(time(NLurate)[length(NLurate)],1,4))," Q",as.character(cycle(NLurate[length(NLurate)])),sep=""), side = 3, line=0.5, cex = 1) legend("topright", paste("2008 Q1 - ",as.character(substr(time(NLurate)[length(NLurate)],1,4))," Q",as.character(cycle(NLurate[length(NLurate)])),sep=""), col="red", lwd=1.5, inset=.02) dev.copy2pdf(file=paste("NL-beveridge-",Sys.Date(),".pdf", sep=""), width=8, height=6, pointsize=12) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),"/png",sep="")) dev.print(png, file=paste("NL-beveridge-",Sys.Date(),".png", sep=""), pointsize=12, width=8, height=6, units="in", bg="white", res=400) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),sep="")) ######################## #Spain Beveridge Curve plot(ESurate, ESvac, type="o", main="Spain Beveridge Curve", xlab="unemployment rate (percent)", ylab="vacancy rate (percent)", col="blue", xy.labels=FALSE, yaxt="n", xaxt="n", tck=1, lwd=.9, pch=20, family="Times") axis(2, tick=TRUE, tck=1, lwd.ticks=.1, col.ticks="grey80") axis(1, tick=TRUE, tck=1, lwd.ticks=.1, col.ticks="grey80") points(ESurate, ESvac, type="o", col="mediumblue", lwd=.9, pch=20) points(window(ESurate,start=c(2008,1),end=NULL), window(ESvac,start=c(2008,1),end=NULL), col="red", type="o", pch=20, lwd=1.5) box() mtext("Source: Eurostat", side = 4, line= 1, cex = .7, adj = 0) mtext("Cooley-Rupert Economic Snapshot; www.europeansnapshot.com", side = 4, line= 0, cex = .7, adj = 0) mtext(paste("2009 Q1 - ",as.character(substr(time(ESurate)[length(ESurate)],1,4))," Q",as.character(cycle(ESurate[length(ESurate)])),sep=""), side = 3, line=0.5, cex = 1) dev.copy2pdf(file=paste("ES-beveridge-",Sys.Date(),".pdf", sep=""), width=8, height=6, pointsize=12) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),"/png",sep="")) dev.print(png, file=paste("ES-beveridge-",Sys.Date(),".png", sep=""), pointsize=12, width=8, height=6, units="in", bg="white", res=400) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),sep="")) ############################################################### #gross debt-to-income ratio of households - Change from Peak plot(UKhhdebt.08, main="Gross Debt-to-Income Ratio of Households", ylab="", xlab="Years from 2008 peak", col="white", type="l", lwd=2, axes=FALSE, yaxs="i", xaxs="i", tck=1, bty="l", family="Times", ylim=c(min(as.numeric(EShhdebt.08), as.numeric(IThhdebt.08), as.numeric(UKhhdebt.08), as.numeric(DEhhdebt.08), as.numeric(FRhhdebt.08), as.numeric(NLhhdebt.08), na.rm=TRUE)-1,max(as.numeric(EShhdebt.08), as.numeric(IThhdebt.08), as.numeric(UKhhdebt.08), as.numeric(DEhhdebt.08), as.numeric(FRhhdebt.08), as.numeric(NLhhdebt.08), na.rm=TRUE)+1)) axis(2, tick=TRUE, tck=1, lwd.ticks=.1, col.ticks="grey") axis(1, tick=TRUE, las=1, at=c(seq(0,6,1))) abline(h=0) lines(DEhhdebt.08,col="darkgreen",lwd=2) lines(FRhhdebt.08,col="orange3",lwd=2) lines(UKhhdebt.08,col="red",lwd=2) lines(EShhdebt.08,col="orangered4",lwd=2) lines(IThhdebt.08,col="aquamarine4", lwd=2) lines(NLhhdebt.08, col="purple4", lwd=2) box() legend("topleft", c("Germany","France","United Kingdom","Spain", "Italy", "Netherlands"), col=c("darkgreen","orange3","red","orangered4", "aquamarine4", "purple4"), lwd=c(2,2,2,2,2,2), lty=c(1,1,1,1,1,1), inset=.02, cex=.75, bg="gray87") mtext("Percentage point change from 2008 peak", side = 3, line=0.5, cex = 1) mtext("Cooley-Rupert European Economic Snapshot; www.europeansnapshot.com", side = 4, line= 0, cex = .7, adj = 0) mtext("Source: Eurostat", side = 4, line= 1, cex = .7, adj = 0) dev.copy2pdf(file=paste("ALL-hhdebtch-",Sys.Date(),".pdf", sep=""), width=8, height=6, pointsize=12) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),"/png",sep="")) dev.print(png, file=paste("ALL-hhdebtch-",Sys.Date(),".png", sep=""), pointsize=12, width=8, height=6, units="in", bg="white", res=400) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),sep="")) ############################################################### #net debt-to-income ratio after taxes of non-financial corporations - Change from Peak plot(UKcorpdebt.08, main="Net After-Tax Debt-to-Income Ratio of Non-Financial Corporations", ylab="", xlab="Years from 2008 peak", col="white", type="l", lwd=2, axes=FALSE, yaxs="i", xaxs="i", tck=1, bty="l", family="Times", ylim=c(min(as.numeric(EScorpdebt.08), as.numeric(ITcorpdebt.08), as.numeric(UKcorpdebt.08), as.numeric(DEcorpdebt.08), as.numeric(FRcorpdebt.08), as.numeric(NLcorpdebt.08), na.rm=TRUE)-1,max(as.numeric(EScorpdebt.08), as.numeric(ITcorpdebt.08), as.numeric(UKcorpdebt.08), as.numeric(DEcorpdebt.08), as.numeric(FRcorpdebt.08), as.numeric(NLcorpdebt.08), na.rm=TRUE)+1)) axis(2, tick=TRUE, tck=1, lwd.ticks=.1, col.ticks="grey") axis(1, tick=TRUE, las=1, at=c(seq(0,6,1))) abline(h=0) lines(DEcorpdebt.08,col="darkgreen",lwd=2) lines(FRcorpdebt.08,col="orange3",lwd=2) lines(UKcorpdebt.08,col="red",lwd=2) lines(EScorpdebt.08,col="orangered4",lwd=2) lines(ITcorpdebt.08,col="aquamarine4", lwd=2) lines(NLcorpdebt.08, col="purple4", lwd=2) box() legend("bottomright", c("Germany","France","United Kingdom","Spain", "Italy", "Netherlands"), col=c("darkgreen","orange3","red","orangered4", "aquamarine4", "purple4"), lwd=c(2,2,2,2,2,2), lty=c(1,1,1,1,1,1), inset=.02, cex=.75, bg="gray87") mtext("Percentage point change from 2008 peak", side = 3, line=0.5, cex = 1) mtext("Cooley-Rupert European Economic Snapshot; www.europeansnapshot.com", side = 4, line= 0, cex = .7, adj = 0) mtext("Source: Eurostat", side = 4, line= 1, cex = .7, adj = 0) dev.copy2pdf(file=paste("ALL-corpdebtch-",Sys.Date(),".pdf", sep=""), width=8, height=6, pointsize=12) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),"/png",sep="")) dev.print(png, file=paste("ALL-corpdebtch-",Sys.Date(),".png", sep=""), pointsize=12, width=8, height=6, units="in", bg="white", res=400) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),sep="")) ############################################################### #Financial Liabilities of Households - Change from Peak plot(UKhhdebt2.08, main="Financial Liabilities of Households", ylab="", xlab="Years from 2008 peak", col="white", type="l", lwd=2, axes=FALSE, yaxs="i", xaxs="i", tck=1, bty="l", family="Times", ylim=c(min(as.numeric(EShhdebt2.08), as.numeric(IThhdebt2.08), as.numeric(UKhhdebt2.08), as.numeric(DEhhdebt2.08), as.numeric(FRhhdebt2.08), as.numeric(NLhhdebt2.08), na.rm=TRUE)-1,max(as.numeric(EShhdebt2.08), as.numeric(IThhdebt2.08), as.numeric(UKhhdebt2.08), as.numeric(DEhhdebt2.08), as.numeric(FRhhdebt2.08), as.numeric(NLhhdebt2.08), na.rm=TRUE)+1)) axis(2, tick=TRUE, tck=1, lwd.ticks=.1, col.ticks="grey") axis(1, tick=TRUE, las=1, at=c(seq(0,6,1))) abline(h=0) lines(DEhhdebt2.08,col="darkgreen",lwd=2) lines(FRhhdebt2.08,col="orange3",lwd=2) lines(UKhhdebt2.08,col="red",lwd=2) lines(EShhdebt2.08,col="orangered4",lwd=2) lines(IThhdebt2.08,col="aquamarine4", lwd=2) lines(NLhhdebt2.08, col="purple4", lwd=2) box() legend("topleft", c("Germany","France","United Kingdom","Spain", "Italy", "Netherlands"), col=c("darkgreen","orange3","red","orangered4", "aquamarine4", "purple4"), lwd=c(2,2,2,2,2,2), lty=c(1,1,1,1,1,1), inset=.02, cex=.75, bg="gray87") mtext("Percent change from 2008 peak", side = 3, line=0.5, cex = 1) mtext("Cooley-Rupert European Economic Snapshot; www.europeansnapshot.com", side = 4, line= 0, cex = .7, adj = 0) mtext("Source: Eurostat", side = 4, line= 1, cex = .7, adj = 0) dev.copy2pdf(file=paste("ALL-hhdebt2ch-",Sys.Date(),".pdf", sep=""), width=8, height=6, pointsize=12) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),"/png",sep="")) dev.print(png, file=paste("ALL-hhdebt2ch-",Sys.Date(),".png", sep=""), pointsize=12, width=8, height=6, units="in", bg="white", res=400) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),sep="")) ############################################################### #Financial Liabilities of Non-Financial Corporations - Change from Peak plot(UKcorpdebt2.08, main="Financial Liabilities of Non-Financial Corporations", ylab="", xlab="Years from 2008 peak", col="white", type="l", lwd=2, axes=FALSE, yaxs="i", xaxs="i", tck=1, bty="l", family="Times", ylim=c(min(as.numeric(EScorpdebt2.08), as.numeric(ITcorpdebt2.08), as.numeric(UKcorpdebt2.08), as.numeric(DEcorpdebt2.08), as.numeric(FRcorpdebt2.08), as.numeric(NLcorpdebt2.08), na.rm=TRUE)-1,max(as.numeric(EScorpdebt2.08), as.numeric(ITcorpdebt2.08), as.numeric(UKcorpdebt2.08), as.numeric(DEcorpdebt2.08), as.numeric(FRcorpdebt2.08), as.numeric(NLcorpdebt2.08), na.rm=TRUE)+1)) axis(2, tick=TRUE, tck=1, lwd.ticks=.1, col.ticks="grey") axis(1, tick=TRUE, las=1, at=c(seq(0,6,1))) abline(h=0) lines(DEcorpdebt2.08,col="darkgreen",lwd=2) lines(FRcorpdebt2.08,col="orange3",lwd=2) lines(UKcorpdebt2.08,col="red",lwd=2) lines(EScorpdebt2.08,col="orangered4",lwd=2) lines(ITcorpdebt2.08,col="aquamarine4", lwd=2) lines(NLcorpdebt2.08, col="purple4", lwd=2) box() legend("topleft", c("Germany","France","United Kingdom","Spain", "Italy", "Netherlands"), col=c("darkgreen","orange3","red","orangered4", "aquamarine4", "purple4"), lwd=c(2,2,2,2,2,2), lty=c(1,1,1,1,1,1), inset=.02, cex=.75, bg="gray87") mtext("Percent change from 2008 peak", side = 3, line=0.5, cex = 1) mtext("Cooley-Rupert European Economic Snapshot; www.europeansnapshot.com", side = 4, line= 0, cex = .7, adj = 0) mtext("Source: Eurostat", side = 4, line= 1, cex = .7, adj = 0) dev.copy2pdf(file=paste("ALL-corpdebt2ch-",Sys.Date(),".pdf", sep=""), width=8, height=6, pointsize=12) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),"/png",sep="")) dev.print(png, file=paste("ALL-corpdebt2ch-",Sys.Date(),".png", sep=""), pointsize=12, width=8, height=6, units="in", bg="white", res=400) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),sep="")) ############################################################### #Loan Liabilities of Households - Change from Peak plot(UKhhloan.08, main="Loan Liabilities of Households", ylab="", xlab="Years from 2008 peak", col="white", type="l", lwd=2, axes=FALSE, yaxs="i", xaxs="i", tck=1, bty="l", family="Times", ylim=c(min(as.numeric(EShhloan.08), as.numeric(IThhloan.08), as.numeric(UKhhloan.08), as.numeric(DEhhloan.08), as.numeric(FRhhloan.08), as.numeric(NLhhloan.08), na.rm=TRUE)-1,max(as.numeric(EShhloan.08), as.numeric(IThhloan.08), as.numeric(UKhhloan.08), as.numeric(DEhhloan.08), as.numeric(FRhhloan.08), as.numeric(NLhhloan.08), na.rm=TRUE)+1)) axis(2, tick=TRUE, tck=1, lwd.ticks=.1, col.ticks="grey") axis(1, tick=TRUE, las=1, at=c(seq(0,6,1))) abline(h=0) lines(DEhhloan.08,col="darkgreen",lwd=2) lines(FRhhloan.08,col="orange3",lwd=2) lines(UKhhloan.08,col="red",lwd=2) lines(EShhloan.08,col="orangered4",lwd=2) lines(IThhloan.08,col="aquamarine4", lwd=2) lines(NLhhloan.08, col="purple4", lwd=2) box() legend("topleft", c("Germany","France","United Kingdom","Spain", "Italy", "Netherlands"), col=c("darkgreen","orange3","red","orangered4", "aquamarine4", "purple4"), lwd=c(2,2,2,2,2,2), lty=c(1,1,1,1,1,1), inset=.02, cex=.75, bg="gray87") mtext("Percent change from 2008 peak", side = 3, line=0.5, cex = 1) mtext("Cooley-Rupert European Economic Snapshot; www.europeansnapshot.com", side = 4, line= 0, cex = .7, adj = 0) mtext("Source: Eurostat", side = 4, line= 1, cex = .7, adj = 0) dev.copy2pdf(file=paste("ALL-hhloanch-",Sys.Date(),".pdf", sep=""), width=8, height=6, pointsize=12) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),"/png",sep="")) dev.print(png, file=paste("ALL-hhloanch-",Sys.Date(),".png", sep=""), pointsize=12, width=8, height=6, units="in", bg="white", res=400) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),sep="")) ############################################################### #Loan Liabilities of Non-Financial Corporations - Change from Peak plot(UKcorploan.08, main="Loan Liabilities of Non-Financial Corporations", ylab="", xlab="Years from 2008 peak", col="white", type="l", lwd=2, axes=FALSE, yaxs="i", xaxs="i", tck=1, bty="l", family="Times", ylim=c(min(as.numeric(EScorploan.08), as.numeric(ITcorploan.08), as.numeric(UKcorploan.08), as.numeric(DEcorploan.08), as.numeric(FRcorploan.08), as.numeric(NLcorploan.08), na.rm=TRUE)-1,max(as.numeric(EScorploan.08), as.numeric(ITcorploan.08), as.numeric(UKcorploan.08), as.numeric(DEcorploan.08), as.numeric(FRcorploan.08), as.numeric(NLcorploan.08), na.rm=TRUE)+1)) axis(2, tick=TRUE, tck=1, lwd.ticks=.1, col.ticks="grey") axis(1, tick=TRUE, las=1, at=c(seq(0,6,1))) abline(h=0) lines(DEcorploan.08,col="darkgreen",lwd=2) lines(FRcorploan.08,col="orange3",lwd=2) lines(UKcorploan.08,col="red",lwd=2) lines(EScorploan.08,col="orangered4",lwd=2) lines(ITcorploan.08,col="aquamarine4", lwd=2) lines(NLcorploan.08, col="purple4", lwd=2) box() legend("topleft", c("Germany","France","United Kingdom","Spain", "Italy", "Netherlands"), col=c("darkgreen","orange3","red","orangered4", "aquamarine4", "purple4"), lwd=c(2,2,2,2,2,2), lty=c(1,1,1,1,1,1), inset=.02, cex=.75, bg="gray87") mtext("Percent change from 2008 peak", side = 3, line=0.5, cex = 1) mtext("Cooley-Rupert European Economic Snapshot; www.europeansnapshot.com", side = 4, line= 0, cex = .7, adj = 0) mtext("Source: Eurostat", side = 4, line= 1, cex = .7, adj = 0) dev.copy2pdf(file=paste("ALL-corploanch-",Sys.Date(),".pdf", sep=""), width=8, height=6, pointsize=12) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),"/png",sep="")) dev.print(png, file=paste("ALL-corploanch-",Sys.Date(),".png", sep=""), pointsize=12, width=8, height=6, units="in", bg="white", res=400) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),sep="")) ############################################################### #Long-Term Loan Liabilities of Households - Change from Peak plot(UKhhloanl.08, main="Long-Term Loan Liabilities of Households", ylab="", xlab="Years from 2008 peak", col="white", type="l", lwd=2, axes=FALSE, yaxs="i", xaxs="i", tck=1, bty="l", family="Times", ylim=c(min(as.numeric(EShhloanl.08), as.numeric(IThhloanl.08), as.numeric(UKhhloanl.08), as.numeric(DEhhloanl.08), as.numeric(FRhhloanl.08), as.numeric(NLhhloanl.08), na.rm=TRUE)-1,max(as.numeric(EShhloanl.08), as.numeric(IThhloanl.08), as.numeric(UKhhloanl.08), as.numeric(DEhhloanl.08), as.numeric(FRhhloanl.08), as.numeric(NLhhloanl.08), na.rm=TRUE)+1)) axis(2, tick=TRUE, tck=1, lwd.ticks=.1, col.ticks="grey") axis(1, tick=TRUE, las=1, at=c(seq(0,6,1))) abline(h=0) lines(DEhhloanl.08,col="darkgreen",lwd=2) lines(FRhhloanl.08,col="orange3",lwd=2) lines(UKhhloanl.08,col="red",lwd=2) lines(EShhloanl.08,col="orangered4",lwd=2) lines(IThhloanl.08,col="aquamarine4", lwd=2) lines(NLhhloanl.08, col="purple4", lwd=2) box() legend("topleft", c("Germany","France","United Kingdom","Spain", "Italy", "Netherlands"), col=c("darkgreen","orange3","red","orangered4", "aquamarine4", "purple4"), lwd=c(2,2,2,2,2,2), lty=c(1,1,1,1,1,1), inset=.02, cex=.75, bg="gray87") mtext("Percent change from 2008 peak", side = 3, line=0.5, cex = 1) mtext("Cooley-Rupert European Economic Snapshot; www.europeansnapshot.com", side = 4, line= 0, cex = .7, adj = 0) mtext("Source: Eurostat", side = 4, line= 1, cex = .7, adj = 0) dev.copy2pdf(file=paste("ALL-hhloanlch-",Sys.Date(),".pdf", sep=""), width=8, height=6, pointsize=12) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),"/png",sep="")) dev.print(png, file=paste("ALL-hhloanlch-",Sys.Date(),".png", sep=""), pointsize=12, width=8, height=6, units="in", bg="white", res=400) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),sep="")) ############################################################### #Long-Term Loan Liabilities of Non-Financial Corporations - Change from Peak plot(UKcorploanl.08, main="Long-Term Loan Liabilities of Non-Financial Corporations", ylab="", xlab="Years from 2008 peak", col="white", type="l", lwd=2, axes=FALSE, yaxs="i", xaxs="i", tck=1, bty="l", family="Times", ylim=c(min(as.numeric(EScorploanl.08), as.numeric(ITcorploanl.08), as.numeric(UKcorploanl.08), as.numeric(DEcorploanl.08), as.numeric(FRcorploanl.08), as.numeric(NLcorploanl.08), na.rm=TRUE)-1,max(as.numeric(EScorploanl.08), as.numeric(ITcorploanl.08), as.numeric(UKcorploanl.08), as.numeric(DEcorploanl.08), as.numeric(FRcorploanl.08), as.numeric(NLcorploanl.08), na.rm=TRUE)+1)) axis(2, tick=TRUE, tck=1, lwd.ticks=.1, col.ticks="grey") axis(1, tick=TRUE, las=1, at=c(seq(0,6,1))) abline(h=0) lines(DEcorploanl.08,col="darkgreen",lwd=2) lines(FRcorploanl.08,col="orange3",lwd=2) lines(UKcorploanl.08,col="red",lwd=2) lines(EScorploanl.08,col="orangered4",lwd=2) lines(ITcorploanl.08,col="aquamarine4", lwd=2) lines(NLcorploanl.08, col="purple4", lwd=2) box() legend("topleft", c("Germany","France","United Kingdom","Spain", "Italy", "Netherlands"), col=c("darkgreen","orange3","red","orangered4", "aquamarine4", "purple4"), lwd=c(2,2,2,2,2,2), lty=c(1,1,1,1,1,1), inset=.02, cex=.75, bg="gray87") mtext("Percent change from 2008 peak", side = 3, line=0.5, cex = 1) mtext("Cooley-Rupert European Economic Snapshot; www.europeansnapshot.com", side = 4, line= 0, cex = .7, adj = 0) mtext("Source: Eurostat", side = 4, line= 1, cex = .7, adj = 0) dev.copy2pdf(file=paste("ALL-corploanlch-",Sys.Date(),".pdf", sep=""), width=8, height=6, pointsize=12) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),"/png",sep="")) dev.print(png, file=paste("ALL-corploanlch-",Sys.Date(),".png", sep=""), pointsize=12, width=8, height=6, units="in", bg="white", res=400) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),sep="")) ############################################################### #Short-Term Loan Liabilities of Households - Change from Peak plot(UKhhloans.08, main="Short-Term Loan Liabilities of Households", ylab="", xlab="Years from 2008 peak", col="white", type="l", lwd=2, axes=FALSE, yaxs="i", xaxs="i", tck=1, bty="l", family="Times", ylim=c(min(as.numeric(EShhloans.08), as.numeric(IThhloans.08), as.numeric(UKhhloans.08), as.numeric(DEhhloans.08), as.numeric(FRhhloans.08), as.numeric(NLhhloans.08), na.rm=TRUE)-1,max(as.numeric(EShhloans.08), as.numeric(IThhloans.08), as.numeric(UKhhloans.08), as.numeric(DEhhloans.08), as.numeric(FRhhloans.08), as.numeric(NLhhloans.08), na.rm=TRUE)+1)) axis(2, tick=TRUE, tck=1, lwd.ticks=.1, col.ticks="grey") axis(1, tick=TRUE, las=1, at=c(seq(0,6,1))) abline(h=0) lines(DEhhloans.08,col="darkgreen",lwd=2) lines(FRhhloans.08,col="orange3",lwd=2) lines(UKhhloans.08,col="red",lwd=2) lines(EShhloans.08,col="orangered4",lwd=2) lines(IThhloans.08,col="aquamarine4", lwd=2) lines(NLhhloans.08, col="purple4", lwd=2) box() legend("bottomleft", c("Germany","France","United Kingdom","Spain", "Italy", "Netherlands"), col=c("darkgreen","orange3","red","orangered4", "aquamarine4", "purple4"), lwd=c(2,2,2,2,2,2), lty=c(1,1,1,1,1,1), inset=.02, cex=.75, bg="gray87") mtext("Percent change from 2008 peak", side = 3, line=0.5, cex = 1) mtext("Cooley-Rupert European Economic Snapshot; www.europeansnapshot.com", side = 4, line= 0, cex = .7, adj = 0) mtext("Source: Eurostat", side = 4, line= 1, cex = .7, adj = 0) dev.copy2pdf(file=paste("ALL-hhloansch-",Sys.Date(),".pdf", sep=""), width=8, height=6, pointsize=12) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),"/png",sep="")) dev.print(png, file=paste("ALL-hhloansch-",Sys.Date(),".png", sep=""), pointsize=12, width=8, height=6, units="in", bg="white", res=400) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),sep="")) ############################################################### #Short-Term Loan Liabilities of Non-Financial Corporations - Change from Peak plot(UKcorploans.08, main="Short-Term Loan Liabilities of Non-Financial Corporations", ylab="", xlab="Years from 2008 peak", col="white", type="l", lwd=2, axes=FALSE, yaxs="i", xaxs="i", tck=1, bty="l", family="Times", ylim=c(min(as.numeric(EScorploans.08), as.numeric(ITcorploans.08), as.numeric(UKcorploans.08), as.numeric(DEcorploans.08), as.numeric(FRcorploans.08), as.numeric(NLcorploans.08), na.rm=TRUE)-1,max(as.numeric(EScorploans.08), as.numeric(ITcorploans.08), as.numeric(UKcorploans.08), as.numeric(DEcorploans.08), as.numeric(FRcorploans.08), as.numeric(NLcorploans.08), na.rm=TRUE)+1)) axis(2, tick=TRUE, tck=1, lwd.ticks=.1, col.ticks="grey") axis(1, tick=TRUE, las=1, at=c(seq(0,6,1))) abline(h=0) lines(DEcorploans.08,col="darkgreen",lwd=2) lines(FRcorploans.08,col="orange3",lwd=2) lines(UKcorploans.08,col="red",lwd=2) lines(EScorploans.08,col="orangered4",lwd=2) lines(ITcorploans.08,col="aquamarine4", lwd=2) lines(NLcorploans.08, col="purple4", lwd=2) box() legend("topleft", c("Germany","France","United Kingdom","Spain", "Italy", "Netherlands"), col=c("darkgreen","orange3","red","orangered4", "aquamarine4", "purple4"), lwd=c(2,2,2,2,2,2), lty=c(1,1,1,1,1,1), inset=.02, cex=.75, bg="gray87") mtext("Percent change from 2008 peak", side = 3, line=0.5, cex = 1) mtext("Cooley-Rupert European Economic Snapshot; www.europeansnapshot.com", side = 4, line= 0, cex = .7, adj = 0) mtext("Source: Eurostat", side = 4, line= 1, cex = .7, adj = 0) dev.copy2pdf(file=paste("ALL-corploansch-",Sys.Date(),".pdf", sep=""), width=8, height=6, pointsize=12) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),"/png",sep="")) dev.print(png, file=paste("ALL-corploansch-",Sys.Date(),".png", sep=""), pointsize=12, width=8, height=6, units="in", bg="white", res=400) setwd(paste("~/Dropbox/rupert/EU/",Sys.Date(),sep="")) dev.off() graphics.off() setwd("~/Dropbox/rupert/") source("graphsEU-document.r")