Difference between revisions of "Assessment of building policies' effect on dampness and asthma in Europe"

From Testiwiki
Jump to: navigation, search
m (R code for detailed analysis)
Line 65: Line 65:
 
*This code features [[R]] functions described on [[Opasnet Base Connection for R]].  
 
*This code features [[R]] functions described on [[Opasnet Base Connection for R]].  
  
  <nowiki>##### Plot #####
+
  <nowiki>library(ggplot2)
 
asthma <- op_baseGetData("opasnet_base", "Op_en4723")
 
asthma <- op_baseGetData("opasnet_base", "Op_en4723")
 
array <- DataframeToArray(asthma)
 
array <- DataframeToArray(asthma)
Line 111: Line 111:
 
final3
 
final3
 
##### Probability density plot #####
 
##### Probability density plot #####
test <- as.data.frame(as.table(cost[,,1,4]))
+
test <- as.data.frame(as.table(apply(cost, c(1,3,4), sum)))
plot4 <- ggplot(test, aes(Freq)) + geom_histogram(binwidth=10^6) + xlim(-1e8,2e9)
+
plot4 <- ggplot(test, aes(x=Freq, y=..count..)) + geom_density() + scale_x_continuous("Cost (M€)") +
 +
scale_y_continuous("Density") + facet_wrap(~Year ~policy)
 
plot4</nowiki>
 
plot4</nowiki>
  

Revision as of 07:33, 31 January 2011



Scope

Purpose

What are the effects of different building policies on dampness and asthma prevalence in Europe?

Boundaries etc.

Boundaries, scenarios, intended users, and participants are the same as in the Mega case study.

Definition

Error creating thumbnail: Unable to save thumbnail to destination
A causal diagram of health effects of dampness in Europe.
Decision variables
Other variables
Indicators

Analyses

Building mould and dampness case study

  • Estimates health impacts of dampness and mould in residential buildings on asthma prevalence in Europe.
  • Nation-wide dampness estimates were obtained from several studies reviewed in this sub-assessment (http://heande.opasnet.org/wiki/Moisture_damage).
  • Several countries (Luxembourg, Netherlands, Switzerland, Ireland, Norway, United Kingdom, Bulgaria, Hungary, Lithuania, Romania, Slovakia, Slovenia, Malta) were rejected due to lack of data.
  • Exposure-response function was 1.56 (OR) for current asthma risk (prevalence) due to existing dampness problem (Fisk et al., 2007).
  • Linear no-threshold ERF was assumed for the whole population in each country.
  • The model development, data storage, and model runs were all performed in Opasnet using R software and Opasnet Base.
  • The main page of the sub-assessment is http://en.opasnet.org/w/Assessment_of_building_policies%27_effect_on_dampness_and_asthma_in_Europe


Outcomes of interest of mould and dampness sub-assessment.

  • Main health impact: number of asthma cases (prevalence) attributable to indoor problems due to residential mould or dampness.
  • Preliminary estimate of DALYs attributable to asthma were based on disability weight 0.056 (weight of a treated asthma case from WHO).
  • Preliminary estimate of monetary impact was obtained indirectly by converting DALYs into euros; other cost types were ignored.
    • One DALY estimated to be worth 30-60 k€.
  • Methodological outcome: proof of concept for running assessment models via open internet interface.

R code for detailed analysis

library(ggplot2)
asthma <- op_baseGetData("opasnet_base", "Op_en4723")
array <- DataframeToArray(asthma)
array <- array[,,,c(2,1,3,4,5),,]
##### Cases #####
means <- apply(array, c(2,3,4), mean, na.rm=TRUE)
means <- apply(means, c(2,3), sum, na.rm=TRUE)
plot1 <- as.data.frame(as.table(means))
plot1 <- ggplot(plot1[plot1[,"Freq"]!=0,], aes(Year, weight=Freq, fill=policy)) + geom_bar(position="dodge") + 
scale_x_discrete("Year") + scale_y_continuous("Cases")
plot1
ci <- apply(apply(array, c(1,3,4), sum, na.rm=TRUE), c(2,3), quantile, probs=c(0.025,0.975))
final1 <- means
final1[,] <- paste(round(means), " (", round(ci[1,,]), "-", round(ci[2,,]), ")", sep="")
final1[c(2:5,8:10,13:15)] <- NA
final1
##### DALYs #####
DALY <- array*0.059
means <- apply(DALY, c(2,3,4), mean, na.rm=TRUE)
means <- apply(means, c(2,3), sum, na.rm=TRUE)
plot2 <- as.data.frame(as.table(means))
plot2 <- ggplot(plot2[plot2[,"Freq"]!=0,], aes(Year, weight=Freq, fill=policy)) + geom_bar(position="dodge") + 
scale_x_discrete("Year") + scale_y_continuous("DALYs")
plot2
ci <- apply(apply(DALY, c(1,3,4), sum, na.rm=TRUE), c(2,3), quantile, probs=c(0.025,0.975))
final2 <- means
final2[,] <- paste(round(means), " (", round(ci[1,,]), "-", round(ci[2,,]), ")", sep="")
final2[c(2:5,8:10,13:15)] <- NA
final2
##### Cost #####
cost <- array(NA, dim = c(dim(DALY), 2), dimnames = dimnames(DALY))
cost[,,,,1] <- DALY
cost[,,,,2] <- runif(prod(dim(DALY)),3*10^4,6*10^4)
cost <- cost[,,,,1]*cost[,,,,2]
means <- apply(cost, c(2,3,4), mean, na.rm=TRUE)
means <- apply(means, c(2,3), sum, na.rm=TRUE)/10^6
plot3 <- as.data.frame(as.table(means))
plot3 <- ggplot(plot3[plot3[,"Freq"]!=0,], aes(Year, weight=Freq, fill=policy)) + geom_bar(position="dodge") + 
scale_x_discrete("Year") + scale_y_continuous("Cost (M€)")
plot3
ci <- apply(apply(cost, c(1,3,4), sum, na.rm=TRUE), c(2,3), quantile, probs=c(0.025,0.975))/10^6
final3 <- means
final3[,] <- paste(round(means), " (", round(ci[1,,]), "-", round(ci[2,,]), ")", sep="")
final3[c(2:5,8:10,13:15)] <- NA
final3
##### Probability density plot #####
test <- as.data.frame(as.table(apply(cost, c(1,3,4), sum)))
plot4 <- ggplot(test, aes(x=Freq, y=..count..)) + geom_density() + scale_x_continuous("Cost (M€)") + 
scale_y_continuous("Density") + facet_wrap(~Year ~policy)
plot4

Result

Asthma prevalence due to building dampness in Europe: Show results

Error creating thumbnail: Unable to save thumbnail to destination
The impacts of European building policies on asthma attributable to residential building dampness.
Asthma cases (prevalence) in Europe due to residential building dampness (mean and 95% confidence interval).
Year
Policy 2010 2020 2030 2050
BAU 1715846 (794208-2918407) 2069089 (929518-3645690) 2300513 (1007103-4193891) 2417413 (1016202-4559645)
All NA 2071501 (940391-3650210) 2634778 (1139578-4745158) 3009693 (1251020-5519308)
Biomass NA NA NA 2998888 (1249803-5529395)
Insulation NA NA NA 3002498 (1239186-5524389)
Renovation NA NA NA 3416010 (1443227-6233562)
Asthma DALYs in Europe due to residential building dampness (mean and 95% confidence interval).
Year
Policy 2010 2020 2030 2050
BAU 101235 (46858-172186) 122076 (54842-215096) 135730 (59419-247440) 142627 (59956-269019)
All NA 122219 (55483-215362) 155452 (67235-279964) 177572 (73810-325639)
Biomass NA NA NA 176934 (73738-326234)
Insulation NA NA NA 177147 (73112-325939)
Renovation NA NA NA 201545 (85150-367780)
Asthma monetary impact (based on DALYs) in Europe due to residential building dampness (mean and 95% confidence interval). Unit: M€
Year
Policy 2010 2020 2030 2050
BAU 4552 (2065-7861) 5478 (2464-9800) 6105 (2617-11307) 6404 (2622-12279)
All NA 5491 (2434-9869) 7012 (2981-13005) 7989 (3285-14872)
Biomass NA NA NA 7964 (3267-15239)
Insulation NA NA NA 7995 (3244-15283)
Renovation NA NA NA 9059 (3827-16881)
Asthma cases (prevalence) attributable to residential building dampness in Europe in 2010.
Country of observation Mean SD
Austria 23958 19818
Belgium 46983 24769
Cyprus 3010 706
Czech Republic 65640 31215
Denmark 9088 6502
Estonia 8188 2735
Finland 10881 17198
France 303354 161230
Germany 379346 221077
Greece 20517 7842
Italy 279127 99106
Latvia 11991 3158
Poland 270064 49342
Portugal 48477 18082
Spain 226670 93709
Sweden 20039 24323
Total 1715846

See also

Keywords

Dampness, indoor air, asthma, Europe

References