Difference between revisions of "Burden of disease"

From Testiwiki
Jump to: navigation, search
(See also)
(Calculations)
 
(5 intermediate revisions by the same user not shown)
Line 140: Line 140:
 
{{comment|# |The rest were already in the list above, so there's no point digging out the links twice|--[[User:Heta|Heta]] ([[User talk:Heta|talk]]) 10:50, 4 February 2016 (UTC)}}
 
{{comment|# |The rest were already in the list above, so there's no point digging out the links twice|--[[User:Heta|Heta]] ([[User talk:Heta|talk]]) 10:50, 4 February 2016 (UTC)}}
 
}}
 
}}
 +
 +
=== Calculations ===
 +
 +
These ovariables are used to calculate burden of disease based either on relative or absolute risks, and counted as [[DALY]]s. For ovariables that calculate numbers of cases, see [[Health impact assessment]].
 +
 +
Burden of disease estimate for responses that can be calculated based on population attributable fraction (PAF).
 +
 +
<rcode name="BoDpaf" label="Initiate BoDpaf (for developers only)" embed=1>
 +
# This is code Op_en7422/BoDpaf on page [[Burden of disease]]
 +
library(OpasnetUtils)
 +
 +
BoDpaf <- Ovariable(
 +
  "BoDpaf", # This calculates the burden of disease for endpoints using PAF.
 +
  dependencies = data.frame(
 +
    Name = c(
 +
#      "population", # No population; BoDt must be the total BoD in the target population
 +
      "BoDt", # Total burden of disease of the studied responses per a defined time interval
 +
      "RR", # Relative risks for the given exposure
 +
      "sumExposcen" # function that calculates difference between exposure scenarios
 +
    ),
 +
    Ident = c(
 +
#      "Op_en2261/population", # [[Health impact assessment]]
 +
      "Op_en5917/BoDt",      # [[Disease risk]]
 +
      "Op_en2261/RR",        # [[Health impact assessment]]
 +
      "Op_en2261/sumExposcen" # [[Health impact assessment]]
 +
    )
 +
  ),
 +
  formula = function(...) {
 +
    AF <- (RR > 1) * (1 - 1/RR) + (RR <= 1) * (RR - 1) # See [[HIA]] for explanation
 +
    out <- BoDt * AF
 +
 +
    return(sumExposcen(out))
 +
   
 +
  }
 +
)
 +
 +
objects.store(BoDpaf)
 +
cat("Ovariable BoDpaf stored.\n")
 +
</rcode>
 +
 +
BoDcase calculates burden of disease based on numbers of cases, durations of diseases, and disability weights.
 +
 +
<rcode name="BoDcase" label="Initiate BoDcase (for developers only)" embed=1>
 +
# This is code Op_en7422/BoDcase on page [[Burden of disease]]
 +
library(OpasnetUtils)
 +
 +
BoDcase <- Ovariable(
 +
  "BoDcase", # This calculates the burden of disease for endpoints using numbers of cases.
 +
  dependencies = data.frame(
 +
    Name = c(
 +
      "casesrr", # Number of cases from relative endpoints with RR.
 +
      "casesabs", # Number of cases from absolute ERFs.
 +
      "disabilityweight", # Disability weights for each response.
 +
      "duration" # Duration of a response case.
 +
    ),
 +
    Ident = c(
 +
      "Op_en2261/casesrr", # [[Health impact assessment]]
 +
      "Op_en2261/casesabs", # [[Health impact assessment]]
 +
      "Op_en2307/disabilityweight", # [[Disability weights]]
 +
      "Op_en2307/duration" # [[Disability weights]]
 +
    )
 +
  ),
 +
  formula = function(...) {
 +
   
 +
    out <- combine(casesrr, casesabs)
 +
    out <- out * disabilityweight * duration
 +
    return(out)
 +
   
 +
  }
 +
)
 +
 +
objects.store(BoDcase)
 +
cat("Ovariable BoDcase stored.\n")
 +
</rcode>
 +
 +
BoD calculates burden of disease as a combination of burdens of disease based on either PAF or cases. If a response estimate comes from both BoDpaf and BoDcase, one is picked by random for each unique combination, and the source of the estimate is given in a non-marginal index BurdenSource.
 +
 +
<rcode name="BoD" label="Initiate BoD (for developers only)" embed=1>
 +
# This is code Op_en7422/BoD on page [[Burden of disease]]
 +
library(OpasnetUtils)
 +
BoD <- Ovariable(
 +
  "BoD", # This calculates the total burden of disease.
 +
  dependencies = data.frame(
 +
    Name = c(
 +
      "BoDpaf", # Burden of disease as calculated from PAF
 +
      "BoDcase" # Burden of disease as calculated from number of cases
 +
    ),
 +
    Ident = c(
 +
      "Op_en7422/BoDpaf", # [[Burden of disease]]
 +
      "Op_en7422/BoDcase" # [[Burden of disease]]
 +
    )
 +
  ),
 +
  formula = function(...) {
 +
    # Indices that may have NA must be removed.
 +
    out <- OpasnetUtils::combine(
 +
      unkeep(BoDpaf, sources = TRUE),
 +
      unkeep(BoDcase, sources = TRUE),
 +
      name = "Burden"
 +
    )
 +
    out@output <- fillna(out@output, colnames(out@output)[out@marginal])
 +
    out@output <- merge(
 +
      out@output,
 +
      aggregate(
 +
        out@output["BurdenSource"],
 +
        by = out@output[colnames(out@output)[out@marginal]],
 +
        FUN = function(x) if("BoDpaf" %in% x) "BoDpaf" else "BoDcase" # Prefer BoDpaf when possible.
 +
      )
 +
    )
 +
    return(out)
 +
  }
 +
)
 +
 +
objects.store(BoD)
 +
cat("Ovariable BoD stored.\n")
 +
</rcode>
  
 
==See also==
 
==See also==

Latest revision as of 13:37, 8 September 2017

Progression class
In Opasnet many pages being worked on and are in different classes of progression. Thus the information on those pages should be regarded with consideration. The progression class of this page has been assessed:
This page is a draft
The relevat content and structure of the page is already present, but there still is a lot of missing content.
The content and quality of this page is being curated by THL.
Error creating thumbnail: Unable to save thumbnail to destination

The quality was last checked: 2016-04-10.


Question

How to estimate the disease burden of important risk factors?

Answer

# : THIS PAGE SHOULD CONTAIN AN OVERVIEW ON HOW TO PERFORM DISEASE BURDEN STUDIES. --Jouni (talk) 16:16, 10 April 2016 (UTC)

Rationale

Global Burden of Disease Study 2010

Data from the study

Instructions

  • Download the data from this page as csv
  • Change names of columns: Causes of disease or injury -> Response; Measurement -> Unit; Value -> Result. Move Result to the rightmost column.
  • Upload the csv to Opasnet Base using OpasnetBaseImport to table "GBD by risk factor" and unit "several". (This is for archiving purposes only: the latter tasks may be easier directly from the csv file.)
  • Pick only rows with Unit = DALY per 100000.
  • Sum over causes of disease so that you get one value for each risk factor.
  • Go to Wikidata and suggest that "disease burden" is taken as a new property. When the property is available,
  • go to each Item of the risk factor and add property disease burden to that item. Include qualifiers Global, Both sexes, Year 2013, all ages, all causes. (Find out what properties are available)
  • Make references to the link above, the IHME institute, this article, and secondarily to this Opasnet page. Remember to put date of entry.



Calculations

These ovariables are used to calculate burden of disease based either on relative or absolute risks, and counted as DALYs. For ovariables that calculate numbers of cases, see Health impact assessment.

Burden of disease estimate for responses that can be calculated based on population attributable fraction (PAF).

+ Show code

BoDcase calculates burden of disease based on numbers of cases, durations of diseases, and disability weights.

+ Show code

BoD calculates burden of disease as a combination of burdens of disease based on either PAF or cases. If a response estimate comes from both BoDpaf and BoDcase, one is picked by random for each unique combination, and the source of the estimate is given in a non-marginal index BurdenSource.

+ Show code

See also

Keywords

References

  1. Reference to the Lim Lancet article