Health impact of radon in Europe: Difference between revisions
Jump to navigation
Jump to search
m (→Results) |
(updated data and added some plots) |
||
Line 68: | Line 68: | ||
<nowiki> | <nowiki> | ||
library(ggplot2) | |||
cancer <- op_baseGetData("opasnet_base", "Op_en4715", exclude = 48823) | |||
array <- DataframeToArray(cancer) | |||
array <- array[,,,c(2,1,3,4),,] | |||
##### Cases ##### | ##### Cases ##### | ||
means <- apply(array, c(2,3,4), mean, na.rm=TRUE) | |||
means <- apply(array, c(3,4 | |||
means <- apply(means, c(2,3), sum, na.rm=TRUE) | means <- apply(means, c(2,3), sum, na.rm=TRUE) | ||
ci <- apply(apply(array, c(1,4 | 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 <- means | ||
final1[,] <- paste(round(means), " (", round(ci[1,,]), "-", round(ci[2,,]), ")", sep="") | final1[,] <- paste(round(means), " (", round(ci[1,,]), "-", round(ci[2,,]), ")", sep="") | ||
final1[c( | final1[c(2:4,7:8,11:12)] <- NA | ||
final1 | final1 | ||
##### DALYs ##### | ##### DALYs ##### | ||
DALY <- array(NA, dim = c(dim(array), 3), dimnames = dimnames(array)) | DALY <- array(NA, dim = c(dim(array), 3), dimnames = dimnames(array)) | ||
DALY[ | DALY[,,,,1] <- array | ||
DALY[ | DALY[,,,,2] <- runif(prod(dim(array)),2,36)/12 | ||
DALY[ | DALY[,,,,3] <- runif(prod(dim(array)),1,15) | ||
DALY <- DALY[ | DALY <- DALY[,,,,1]*0.146*DALY[,,,,2]+DALY[,,,,1]*DALY[,,,,3] | ||
means <- apply(DALY, c(2,3,4), mean, na.rm=TRUE) | means <- apply(DALY, c(2,3,4), mean, na.rm=TRUE) | ||
means <- apply(means, c(2,3), sum, 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)) | 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 <- means | ||
final2[,] <- paste(round(means), " (", round(ci[1,,]), "-", round(ci[2,,]), ")", sep="") | final2[,] <- paste(round(means), " (", round(ci[1,,]), "-", round(ci[2,,]), ")", sep="") | ||
final2[c( | final2[c(2:4,7:8,11:12)] <- NA | ||
final2 | final2 | ||
##### Cost ##### | ##### Cost ##### | ||
Line 102: | Line 108: | ||
means <- apply(cost, c(2,3,4), mean, na.rm=TRUE) | means <- apply(cost, c(2,3,4), mean, na.rm=TRUE) | ||
means <- apply(means, c(2,3), sum, na.rm=TRUE)/10^6 | 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 | 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 <- means | ||
final3[,] <- paste(round(means), " (", round(ci[1,,]), "-", round(ci[2,,]), ")", sep="") | final3[,] <- paste(round(means), " (", round(ci[1,,]), "-", round(ci[2,,]), ")", sep="") | ||
final3[c( | final3[c(2:4,7:8,11:12)] <- NA | ||
final3</nowiki> | final3 | ||
##### Probability density plot ##### | |||
test <- as.data.frame(as.table(apply(cost, c(1,3,4), sum)/1e9)) | |||
test <- test[is.na(test[,"Freq"])==FALSE,] | |||
plot4 <- ggplot(test, aes(x=Freq, y=..density..)) + geom_density() + scale_x_continuous(expression("Cost ("*10^9*"€)"), limits = c(-20,300)) + | |||
scale_y_continuous("Density") + facet_grid(policy ~Year) | |||
plot4</nowiki> | |||
==Result== | ==Result== | ||
Line 116: | Line 132: | ||
*Results for the Biomass scenario [[:heande:Air exchange rate for European residences#Definition|are wrong]] and the scenario is perhaps irrelevant because biomass usage does not affect air exchange rates which this assessment is concerned with, so it should be ignored. | *Results for the Biomass scenario [[:heande:Air exchange rate for European residences#Definition|are wrong]] and the scenario is perhaps irrelevant because biomass usage does not affect air exchange rates which this assessment is concerned with, so it should be ignored. | ||
<br/> | <br/> | ||
[[Image:Health impact of radon.png|thumb|The impacts of European building policies on lung cancer due to indoor radon.]] | |||
[[Image:Health impact of radon distribution.png|thumb|Result distributions]] | |||
{|{{prettytable}} | {|{{prettytable}} | ||
Line 123: | Line 143: | ||
!Policy!!2010!!2020!!2030!!2050 | !Policy!!2010!!2020!!2030!!2050 | ||
|---- | |---- | ||
|BAU || | |BAU || 43074 (7186-104660) || 51801 (8934-129303) || 58716 (9427-155621) || 63718 (10407-178566) | ||
|---- | |---- | ||
| | |All || NA || 52660 (8892-130780) || 68086 (10544-180827) || 81022 (11983-235695) | ||
|---- | |---- | ||
|Insulation || NA || NA || NA || | |Insulation || NA || NA || NA || 80149 (11898-228747) | ||
|---- | |---- | ||
|Renovation || NA || NA || NA || | |Renovation || NA || NA || NA || 92783 (13365-275851) | ||
|---- | |---- | ||
|} | |} | ||
Line 141: | Line 159: | ||
!Policy!!2010!!2020!!2030!!2050 | !Policy!!2010!!2020!!2030!!2050 | ||
|---- | |---- | ||
|BAU || | |BAU || 358244 (54193-940205) || 427824 (65203-1156026) || 483005 (70921-1335438) || 524154 (80215-1545369) | ||
|---- | |---- | ||
| | |All || NA || 433106 (65625-1140190) || 562607 (78874-1614252) || 663170 (89720-2045648) | ||
|---- | |---- | ||
|Insulation || NA || NA || NA || | |Insulation || NA || NA || NA || 664141 (88638-2108941) | ||
|---- | |---- | ||
|Renovation || NA || NA || NA || | |Renovation || NA || NA || NA || 773105 (107764-2392599) | ||
|---- | |---- | ||
|} | |} | ||
{|{{prettytable}} | {|{{prettytable}} | ||
Line 160: | Line 175: | ||
!Policy!!2010!!2020!!2030!!2050 | !Policy!!2010!!2020!!2030!!2050 | ||
|---- | |---- | ||
|BAU || | |BAU || 16147 (2519-42699) || 19250 (3039-53378) || 21770 (3121-60868) || 23585 (3590-70455) | ||
|---- | |---- | ||
|All || NA || | |All || NA || 19464 (3009-53226) || 25219 (3682-71977) || 29715 (3973-94741) | ||
|---- | |---- | ||
| | |Insulation || NA || NA || NA || 29877 (4049-93146) | ||
|---- | |---- | ||
|Renovation || NA || NA || NA || 34810 (4748-106804) | |||
|Renovation || NA || NA || NA || | |||
|---- | |---- | ||
|} | |} | ||
Line 177: | Line 190: | ||
|---- | |---- | ||
| Austria | | Austria | ||
| | | 1071 | ||
| | | 1202 | ||
|---- | |---- | ||
| Belgium | | Belgium | ||
| | | 885 | ||
| | | 872 | ||
|---- | |---- | ||
| Bulgaria | | Bulgaria | ||
| | | 297 | ||
| | | 338 | ||
|---- | |---- | ||
| Switzerland | | Switzerland | ||
| | | 1540 | ||
| | | 2764 | ||
|---- | |---- | ||
| Cyprus | | Cyprus | ||
| | | 9 | ||
| | | 12 | ||
|---- | |---- | ||
| Germany | | Germany | ||
| | | 4843 | ||
| | | 4207 | ||
|---- | |---- | ||
| Denmark | | Denmark | ||
| | | 373 | ||
| | | 400 | ||
|---- | |---- | ||
| Estonia | | Estonia | ||
| | | 218 | ||
| | | 245 | ||
|---- | |---- | ||
| Spain | | Spain | ||
| | | 8460 | ||
| | | 18071 | ||
|---- | |---- | ||
| Finland | | Finland | ||
| | | 812 | ||
| | | 802 | ||
|---- | |---- | ||
| France | | France | ||
| | | 8320 | ||
| | | 12045 | ||
|---- | |---- | ||
| Greece | | Greece | ||
| | | 813 | ||
| | | 880 | ||
|---- | |---- | ||
| Hungary | | Hungary | ||
| | | 1617 | ||
| | | 2161 | ||
|---- | |---- | ||
| Ireland | | Ireland | ||
| | | 552 | ||
| | | 636 | ||
|---- | |---- | ||
| Italy | | Italy | ||
| | | 4952 | ||
| | | 4444 | ||
|---- | |---- | ||
| Lithuania | | Lithuania | ||
| | | 236 | ||
| | | 277 | ||
|---- | |---- | ||
| Luxembourg | | Luxembourg | ||
| | | 69 | ||
| 64 | | 64 | ||
|---- | |---- | ||
| Latvia | | Latvia | ||
| | | 226 | ||
| | | 294 | ||
|---- | |---- | ||
| Malta | | Malta | ||
Line 253: | Line 266: | ||
|---- | |---- | ||
| Netherlands | | Netherlands | ||
| | | 523 | ||
| | | 350 | ||
|---- | |---- | ||
| Norway | | Norway | ||
| | | 575 | ||
| | | 673 | ||
|---- | |---- | ||
| Poland | | Poland | ||
| | | 2264 | ||
| | | 2151 | ||
|---- | |---- | ||
| Portugal | | Portugal | ||
| | | 1140 | ||
| | | 1214 | ||
|---- | |---- | ||
| Romania | | Romania | ||
| | | 1236 | ||
| | | 1313 | ||
|---- | |---- | ||
| Sweden | | Sweden | ||
| | | 1375 | ||
| | | 1600 | ||
|---- | |---- | ||
| Slovakia | | Slovakia | ||
| | | 626 | ||
| | | 678 | ||
|---- | |---- | ||
|| '''Total'''|| ''' | || '''Total'''|| '''43074'''|| | ||
|---- | |---- | ||
|} | |} |
Revision as of 13:48, 31 January 2011
Moderator:Teemu R (see all) |
|
Upload data
|
Scope
Purpose
What are the health impacts of radon in the indoor air of residential buildings in Europe?
Boundaries etc
Boundaries, scenarios, intended users, and participants are the same as in the Mega case study.
Definition

- Decision variables
- Other variables
- Population of Europe by Country
- WHO mortality data
- heande:HI:Air exchange rate for European residences
- Radon concentrations in European residences
- ERF for long-term indoor exposure to radon and lung cancer
- Indicators
Analyses
Indoor radon case study
- Estimates health impacts of radon in indoor air of residences.
- Nation-wide radon concentration distributions were obtained from EnVIE project and UNSCEAR 2000 report.
- United Kingdom, Czech Republic, and Slovenia were rejected because of lack of data.
- Exposure-response function was 16 % increase of lung cancer incidence due to 100 Bq/m3 increase of radon (Darby 2004 and 2005).
- The same lung cancer background rate was assumed for the whole Europe: 58.2 cases/100000 person-years (Globocan 2008).
- Linear no-threshold ERF 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/Health_impact_of_radon_in_Europe
Outcomes of interest of radon sub-assessment
- Main health impact: number of lung cancer cases attributable to radon.
- Preliminary estimate of DALYs attributable to radon (only draft estimates for duration of disease).
- Disability weight 0.146 (from WHO) used for disease duration.
- Duration of disease estimated at 2-36 months; life-years lost due to lung cancer death estimated at 1-15 years.
- 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
- This code features R functions described on Opasnet Base Connection for R.
library(ggplot2) cancer <- op_baseGetData("opasnet_base", "Op_en4715", exclude = 48823) array <- DataframeToArray(cancer) array <- array[,,,c(2,1,3,4),,] ##### 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:4,7:8,11:12)] <- NA final1 ##### DALYs ##### DALY <- array(NA, dim = c(dim(array), 3), dimnames = dimnames(array)) DALY[,,,,1] <- array DALY[,,,,2] <- runif(prod(dim(array)),2,36)/12 DALY[,,,,3] <- runif(prod(dim(array)),1,15) DALY <- DALY[,,,,1]*0.146*DALY[,,,,2]+DALY[,,,,1]*DALY[,,,,3] 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:4,7:8,11:12)] <- 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:4,7:8,11:12)] <- NA final3 ##### Probability density plot ##### test <- as.data.frame(as.table(apply(cost, c(1,3,4), sum)/1e9)) test <- test[is.na(test[,"Freq"])==FALSE,] plot4 <- ggplot(test, aes(x=Freq, y=..density..)) + geom_density() + scale_x_continuous(expression("Cost ("*10^9*"€)"), limits = c(-20,300)) + scale_y_continuous("Density") + facet_grid(policy ~Year) plot4
Result
Results
Lung cancer cases due to radon in Europe: {{#opasnet_base_link:Op_en4715}}
- Results for the Biomass scenario are wrong and the scenario is perhaps irrelevant because biomass usage does not affect air exchange rates which this assessment is concerned with, so it should be ignored.


Year | ||||
---|---|---|---|---|
Policy | 2010 | 2020 | 2030 | 2050 |
BAU | 43074 (7186-104660) | 51801 (8934-129303) | 58716 (9427-155621) | 63718 (10407-178566) |
All | NA | 52660 (8892-130780) | 68086 (10544-180827) | 81022 (11983-235695) |
Insulation | NA | NA | NA | 80149 (11898-228747) |
Renovation | NA | NA | NA | 92783 (13365-275851) |
Year | ||||
---|---|---|---|---|
Policy | 2010 | 2020 | 2030 | 2050 |
BAU | 358244 (54193-940205) | 427824 (65203-1156026) | 483005 (70921-1335438) | 524154 (80215-1545369) |
All | NA | 433106 (65625-1140190) | 562607 (78874-1614252) | 663170 (89720-2045648) |
Insulation | NA | NA | NA | 664141 (88638-2108941) |
Renovation | NA | NA | NA | 773105 (107764-2392599) |
Year | ||||
---|---|---|---|---|
Policy | 2010 | 2020 | 2030 | 2050 |
BAU | 16147 (2519-42699) | 19250 (3039-53378) | 21770 (3121-60868) | 23585 (3590-70455) |
All | NA | 19464 (3009-53226) | 25219 (3682-71977) | 29715 (3973-94741) |
Insulation | NA | NA | NA | 29877 (4049-93146) |
Renovation | NA | NA | NA | 34810 (4748-106804) |
Country of observation | Mean | SD |
---|---|---|
Austria | 1071 | 1202 |
Belgium | 885 | 872 |
Bulgaria | 297 | 338 |
Switzerland | 1540 | 2764 |
Cyprus | 9 | 12 |
Germany | 4843 | 4207 |
Denmark | 373 | 400 |
Estonia | 218 | 245 |
Spain | 8460 | 18071 |
Finland | 812 | 802 |
France | 8320 | 12045 |
Greece | 813 | 880 |
Hungary | 1617 | 2161 |
Ireland | 552 | 636 |
Italy | 4952 | 4444 |
Lithuania | 236 | 277 |
Luxembourg | 69 | 64 |
Latvia | 226 | 294 |
Malta | 43 | 50 |
Netherlands | 523 | 350 |
Norway | 575 | 673 |
Poland | 2264 | 2151 |
Portugal | 1140 | 1214 |
Romania | 1236 | 1313 |
Sweden | 1375 | 1600 |
Slovakia | 626 | 678 |
Total | 43074 |
Conclusions
See also
- Radon
- ERF for long-term indoor exposure to radon and lung cancer
- An Overview of Radon Surveys in Europe. Joint Research Centre, 2005. ISBN 92-79-01066-2
- In Heande (password-protected)
- heande:HI:Radon Indoor Air Case
Keywords
Radon, indoor air, lung cancer, Europe
References
Related files
<mfanonymousfilelist></mfanonymousfilelist>