Ero sivun ”Epidemiologinen malli” versioiden välillä

Opasnet Suomista
Siirry navigaatioon Siirry hakuun
(→‎Perustelut: ovariablet ladataan nyt op_en:stä, alustuskoodi poistettiin turhana)
Rivi 128: Rivi 128:




objects.latest("Op_fi4305", code_name = "alusta") # [[Pneumokokkirokote]]
objects.latest("Op_en6353", code_name = "initiate") # [[:op_en:Epidemiological modelling]] ovariables VacCar, VacIPD
objects.latest("Op_en6007", code_name = "answer") # [[OpasnetUtils/Drafts]]
objects.latest("Op_en6007", code_name = "answer") # [[OpasnetUtils/Drafts]]


Rivi 264: Rivi 264:
=== Funktioiden alustus ===
=== Funktioiden alustus ===


<rcode name="alusta" label="Alusta funktiot" embed=1>
Mallissa käytetään samoja funktioita ja ovariableja kuin englanninkielisessä mallissa. Katso siis [[:op_en:Epidemiological modelling#Initiate functions]].
 
library(OpasnetUtils)
 
#S1.4. The R-functions
###############################################################################
##
## R code for the core methods introduced in
## Markku Nurhonen and Kari Auranen:
## "Optimal serotype compositions for pneumococcal conjugate
## vaccination under serotype replacement",
## PLoS Computational Biology, 2014.
##
###############################################################################
## List of arguments common to most functions:
##
## IPD = matrix of IPD incidences by age class (columns) and serotype (rows)
## Car = corresponding matrix of carriage incidences
## VT_rows = vector of the row numbers in matrices IPD and Car
## corresponding to vaccine types (VT_rows=0 for no vaccination)
## p = proportion of lost VT carriage which is replaced by NVT carriage
## q = proportion of VT carriage lost either due to elimination or replacement
##
## This code includes 4 functions:
## Vaccination, NextVT, OptimalSequence and OptimalVacc.
##
 
Vaccination<-function(IPD,Car,VT_rows,p,q) {
##
## Result:
## A list of 2 matrices: IPD and carriage incidences
## after vaccination (corresponding to matrices IPD and Car).
## [Markku Nurhonen 2013]
##
if (VT_rows[1]>0) {
IPD<-as.matrix(IPD); Car<-as.matrix(Car)
# Post vaccination carriage incidences
Car_Total<-t(matrix(apply(Car,2,sum),dim(Car)[2],dim(Car)[1]))
Car2<-Car; Car2[VT_rows,]<-0
Car_NVT<-t(matrix(apply(Car2,2,sum),dim(Car2)[2],dim(Car2)[1]))
Car_VT<-Car_Total-Car_NVT
CarNew<-q*(1+p*Car_VT/Car_NVT)*Car2+(1-q)*Car
# Post vaccination IPD incidences
NVT_rows<-seq(dim(IPD)[1])[-1*VT_rows]
# CCR=Case-to-carrier ratios
CCR<-IPD/Car ; IPDNew<-0*IPD
# Apply the equation appearing above
# equation (1) in text for each serotype.
# First term applies to NVTs.
IPDNew[VT_rows,]<-(1-q)*IPD[VT_rows,]
# Second term applies to NVTs.
IPDNew[NVT_rows,]<-((Car_NVT+p*q*Car_VT)*(Car/Car_NVT)*CCR)[NVT_rows,]
}
else {
IPDNew<-IPD; CarNew<-Car
}
list(IPDNew,CarNew)
}
 
NextVT<-function(IPD,Car,VT_rows,p) {
##
## Result:
## A vector of decreases in IPD due to adding a serotype
## to the vaccine. If VT_rows=0, initially no vaccination.
## For row indexes incuded in VT_rows, the result is 0.
## [Markku Nurhonen 2013]
##
IPD<-as.matrix(IPD); Car<-as.matrix(Car)
## VaccMat = IPD and Car matrices after vaccination
VaccMat<-Vaccination(IPD,Car,VT_rows,p,1)
IPD<-VaccMat[[1]]; Car<-VaccMat[[2]]
## Total_IPD,Total_Car = Matrices corresponding to
## overall IPD and carriage in each age class.
Total_IPD<-t(matrix(apply(IPD,2,sum),dim(IPD)[2],dim(IPD)[1]))
Total_Car<-t(matrix(apply(Car,2,sum),dim(Car)[2],dim(Car)[1]))
## Effect = decrease in IPD when one serotype is added to the vaccine.
## See equation (3) in text.
Effect<-(Total_IPD-IPD)*((IPD/(Total_IPD-IPD))-(p*Car/(Total_Car-Car)))
## Special case when only one NVT remains.
IPD_nonzero<-which(apply(IPD,1,sum)!=0)
if (length(IPD_nonzero)==1) {Effect[IPD_nonzero,]<-IPD[IPD_nonzero,]}
 
## Result is obtained after summation over age classes.
apply(Effect,1,sum)
}
 
OptimalSequence<-function(IPD,Car,VT_rows,Excluded_rows,p,HowmanyAdded) {
##
## Starting from VTs indicated by the vector VT_rows
## (VT_rows=0, for no vaccination) sequentially add new VTs
## to the vaccine composition s.t. at each step the optimal
## serotype (corresponding to largest decrease in IPD) is added.
##
## Excluded_rows = Vector of indexes of the rows in matrices
## IPD and Car corresponding to serotypes that are not to
## be included in a vaccine composition, e.g. a row
## corresponding to a group of serotypes labelled "Other".
## Enter Excluded_rows=0 for no excluded serotypes.
## HowmanyAdded = number of VTs to be added.
##
## Result:
## Matrix of dimension 2*HowmanyAdded with 1st row indicating
## the row numbers of added serotypes in the order they appear
## in the sequence. The 2nd row lists the decreases in IPD
## due to addition of each type. [Markku Nurhonen 2013]
##
IPD<-as.matrix(IPD); Car<-as.matrix(Car)
## First check the maximum possible number of added VTs.
VT_howmany<-length(VT_rows)
if (VT_rows[1]==0) {VT_howmany<-0}
Excluded_howmany<-length(Excluded_rows)
if (Excluded_rows[1]==0) {Excluded_howmany<-0}
HowmanyAdded<-min(HowmanyAdded,dim(IPD)[1]-(VT_howmany+Excluded_howmany))
BestVTs<-BestEffects<-rep(0,HowmanyAdded)
## Sequential procedure: at each step find the best additional VT.
for (i in 1:HowmanyAdded) {
## Effects = Decrease in IPD after addition of each serotype
Effects<-NextVT(IPD,Car,VT_rows,p)
## Set Effects for VTs and excluded types equal to small values
## so that none of these will be selected as the next VT.
minvalue<- -2*max(abs(Effects))
if (Excluded_howmany>0) {Effects[Excluded_rows]<-minvalue}
if (VT_rows[1]>0) {Effects[VT_rows]<-minvalue}
## BestVTs[i] = Index of serotype with maximum decrease in IPD.
BestVTs[i]<-order(-1*Effects)[1]
## BestEffects[i] = Decrese in IPD due to addition of BestVTs[i]
## to the vaccine.
BestEffects[i]<-Effects[BestVTs[i]]
VT_rows<-c(VT_rows,BestVTs[i])
if (VT_rows[1]==0) {VT_rows<-VT_rows[-1]}
VaccMat<-Vaccination(IPD,Car,VT_rows,p,1)
IPD<-VaccMat[[1]]; Car<-VaccMat[[2]]
}
t(matrix(c(BestVTs,BestEffects),HowmanyAdded,2))
}
 
OptimalVacc<-function(IPD,Car,VT_rows,p,q,HowmanyAdded) {
##
## Result:
## A list of 3 elements: (1) Row numbers of serotypes in the optimal
## vaccine composition (2)-(3) IPD and carriage incidences
## by serotype and age class corresponding to the optimal
## vaccine formed using the sequential procedure in the
## function OptimalSequence. [Markku Nurhonen 2013]
##
Additional_VTs<-OptimalSequence(IPD,Car,VT_rows,p,HowmanyAdded)[1,]
All_VTs<-c(VT_rows,Additional_VTs)
if (All_VTs[1]==0) All_VTs<-All_VTs[-1]
VaccMat<-Vaccination(IPD,Car,All_VTs,p,q)
list(All_VTs,VaccMat[[1]],VaccMat[[2]])
}
 
VacCar <- Ovariable("VacCar",
dependencies = data.frame(Name = c(
"IPD", # incidence of pneumococcus disease
"Car", # number of carriers of pneumococcus
"servac", # ovariable of serotypes in vaccine (1 for serotypes in a vaccine, otherwise result is 0)
"p", # proportion of eliminated VT carriage that is replaced by NVT carriage
"q" # proportion of of VT carriage eliminated by vaccine
)),
formula = function(...) {
## Result:
## An ovariable of carriage incidences
## after vaccination (corresponding to Car).
## [Markku Nurhonen 2013, Jouni Tuomisto 2014]
# Post vaccination carriage incidences
# Sum over serotypes and drop extra columns
Car_Total<- unkeep(oapply(Car, cols = "Serotype", FUN = sum) * 1, prevresults = TRUE)
# Car2 is a temporary ovariable with NVT carriers only
Car2 <- unkeep(Car * (1 - servac), prevresults = TRUE) # Take only NVT carriers
Car_NVT <- oapply(Car2, cols = "Serotype", FUN = sum) # Carriers of serotypes not in vaccine (NVT)
Car_VT <- Car_Total - Car_NVT # Carriers of vaccine serotypes
 
CarNew <- q * (1 + p * Car_VT / Car_NVT) * Car2 + (1 - q) * Car
 
return(CarNew)
}
)
VacIPD <- Ovariable("VacIPD",
dependencies = data.frame(Name = c(
"IPD", # incidence of pneumococcus disease
"Car", # number of carriers of pneumococcus
"servac", # ovariable of serotypes in vaccine (1 for serotypes in a vaccine, otherwise result is 0)
"p", # proportion of eliminated VT carriage that is replaced by NVT carriage
"q" # proportion of of VT carriage eliminated by vaccine
)),
formula = function(...) {
## Result:
## An ovariable of IPD incidence
## after vaccination (corresponding to ovariable IPD).
## [Markku Nurhonen 2013, Jouni Tuomisto 2014]
# Post vaccination carriage incidences (same code as in VacCar)
Car_Total <- unkeep(oapply(Car, cols = "Serotype", FUN = sum) * 1, prevresults = TRUE) # Sums over serotypes
Car2 <- unkeep(Car * (1 - servac), prevresults = TRUE)
Car_NVT <- oapply(Car2, cols = "Serotype", FUN = sum) # Carriers of serotypes not in vaccine (NVT)
Car_VT <- Car_Total - Car_NVT # Carriers of vaccine serotypes
CarNew <- q * (1 + p * Car_VT / Car_NVT) * Car2 + (1 - q) * Car
# Post vaccination IPD incidences
# CCR=Case-to-carrier ratios
CCR <- IPD / Car
 
# Apply the equation appearing above
# equation (1) in text for each serotype.
# First term applies to VTs.
IPDNewVT <- (1 - q) * IPD * servac
 
# Second term applies to NVTs.
IPDNewNVT <- (Car_NVT + p * q * Car_VT) * (Car / Car_NVT) * CCR * (1 - servac)
 
IPDNew <- IPDNewVT + IPDNewNVT
 
return(IPDNew)
}
)
 
objects.store(Vaccination, NextVT, OptimalSequence, OptimalVacc, VacCar, VacIPD)
 
cat("Funktiot Vaccination, NextVT, OptimalSequence, OptimalVacc sekä ovariablet VacCar, VacIPD tallennettu. \n")
 
</rcode>


=== Data ===
=== Data ===

Versio 15. heinäkuuta 2014 kello 13.48

Edistymisluokitus
Opasnetissa lukuisat sivut ovat työn alla eri vaiheissa. Niiden tietosisältöön pitää siis suhtautua harkiten. Tämän sivun sisällön edistyminen on arvioitu:
Tämä sivu on täysluonnos
Sivu on kirjoitettu kertaalleen alusta loppuun eli kaikki olennaiset sisällöt ovat jo paikoillaan. Kuitenkaan sisältöjä ei ole vielä kunnolla tarkistettu, ja esimerkiksi tärkeitä viitteitä voi puuttua.


Kysymys

Miten arvioidaan vakavan pneumokokkitaudin tautitaakka tilanteessa, jossa kansallisessa rokotusohjelmassa on jo vuodesta 2010 lähtien käytetty pikkulapsille tiettyjä rokoteserotyyppejä sisältävää konjugaattirokotetta?

  • Vakava pneumokokkitauti tarkoittaa invasiivista, veriviljelyllä varmennettua pneumokokkitautia (ks. vertailuperusteet).
  • Arvioidaan tautitapausten vuosittainen määrä kaikissa ikäryhmissä.
  • Rokotuskattavuus, rokotteen teho ja aika rokotusten aloittamisesta ovat riittävät, jotta rokoteserotyyppien nielukantajuus ja tauti häviävät.
  • Oletetaan, että rokoteserotyyppien nielukantajuus korvautuu täysin muilla pneumokokin serotyypeillä, joiden taudinaiheuttamiskyky säilyy ennallaan.

Vastaus

Ennuste vakavien pneumokokkitautitapausten vuosittaisesta määrästä ikäluokittain lasketaan laskennallisen mallin avulla (ks. 'Perustelut' alla). Tässä vaiheessa ennuste koskee veriviljelypositiivista vakavaa pneumokokkitautia (invasive pneumococcal disease, IPD).

Perustelut

Pneumokokkitaudin rokotusten jälkeinen tautitaakka arvioidaan nielukantajuuden laskennallisen korvautumismallin [1] avulla. Mallissa rokoteserotyyppien nielukantajuus häviää vähitellen rokotusohjelman kohdeväestössä sekä rokotetun että rokottamattoman väestönosan keskuudessa. Samalla rokotetyyppien nielukantajuus korvautuu ei-rokotetyyppien kantajuudella. Tämän korvautumisen seuraukset voidaan laskea ennen rokotuksia vallinneiden serotyyppikohtaisten nielukantajuusosuuksien ja tautimäärien perusteella.

Korvautumisen seuraukset riippuvat oleellisesti kahdesta mallissa hyödynnetystä oletuksesta

  1. Rokotteeseen kuulumattomien serotyyppien nielukantajuusosuudet toisiinsa verrattuina eivät muutu rokotuksen vaikutuksesta
  2. Rokotuksella ei ole vaikutusta yksittäisten serotyyppien taudinaiheuttamiskykyyn

Rokottamisen vaikutus tautimäärään lasketaan nielukantajuuden muutosten kautta ja korvautuminen pneumokokkiserotyyppien nielukantajuudessa heijastuu suoraan muutoksena niiden aiheuttamissa tautimäärissä. Rokotusten vaikutus kokonaistautitaakkaan riippuu oleellisesti rokoteserotyyppien taudinaiheuttamiskyvystä verrattuna muiden serotyyppien taudinaiheuttamiskykyyn. Joidenkin serotyyppien kohdalla tarkastellaan kuitenkin myös vaihtoehtoista oletusta, jossa rokote voi vähentää serotyypin aiheuttaman taudin esiintymistä rokotettujen keskuudessa ilman vaikutusta nielukantajuuteen.

Korvautuminen

Korvautuminen on ilmiö, jossa rokotusten hävittämät pneumokokkiserotyypit korvautuvat väestössä osittain muilla serotyypeillä. Tällöin pneumokokkien kokonaismäärä ei vähene väestössä niin paljon kuin rokoteserotyyppien yleisyys antaisi olettaa. Ilmiötä on tarkemmin kuvattu omalla sivullaan.

Kuva 1. Korvautumismallin periaate. Pneumokokin nielukantajuus (carriage, x-akseli) ja sairastumistapaukset kantajuusepisodia kohden (case-to-carrier ratio, y-akseli) rokotteen serotyypeille (VT) ja serotyypeille joihin rokote ei vaikuta (NVT) ennen rokotusohjelmaa (kuva A) ja sen jälkeen (kuva A). Sairastumistapaukset (DVT ja DNVT) on saatu kertomalla akseleiden arvot ja ne vastaavat kuvaajassa suorakulmion muotoisia alueita. Rokottamisen vaikutuksesta rokoteserotyyppien nielukantajuus häviää ja korvautuu muiden serotyyppien kantajuudella (kuva B). Tautitapausten määrä laskee hävinneen ja korvaavan nielukantajuuden sairastuttavuuden (RVT ja RNVT) eroavuuden vuoksi. Tautihäviämä on (kuva B) merkitty sinisellä suorakulmiolla.


Laskenta

Seuraava ohjelma havainnollistaa korvautumismallia. Ohjelmassa voidaan verrata keskenään rokotteita PCV10 ja PCV13. Lisäksi mukana vertailussa voi olla käyttäjän valitsemat serotyypit sisältävä pneumokokkirokote sekä tilanne, jossa ei rokoteta. Tuloksena esitetään mallin mukainen vakavien pneumokokkitautitapausten lukumäärä Suomessa vuosittain ensin serotyyppikohtaisesti ja sen jälkeen erikseen ikäluokissa <5 vuotta ja 5+ vuotta. Ohjelmakoodi perustuu viitteen [1] liitetiedostoon S1. ----#: . Tämän ohjelmakoodin tarjoamia valintavaihtoehtoja tullaan laajentamaan siten, että osalle serotyypeistä voidaan rokotteen olettaa antavan osittaisen suojan tautia vastaan ilman vaikutusta nielukantajuuteen. --Markku N. (keskustelu) 27. kesäkuuta 2014 kello 10.12 (UTC) (type: truth; paradigms: science: comment)



Ohje käyttäjälle: Voit verrata eri rokotteita keskenään tai rokotetta/rokotteita tilanteeseen, jossa ei rokoteta lainkaan. Valitse ensin vertailuun haluamasi rokotteet. PCV10, PCV13 ja 'Ei rokoteta'-skenaario voi tehdä suoravalintana. Sen lisäksi voit tarkastella myös rokotetta, johon itse valitset haluamasi serotyypit. Valintojen jälkeen klikkaa painiketta "Aja koodi". Tulokset lasketaan erilliselle välilehdelle.

Skenaariot

Mitkä vaihtoehdot otetaan tarkasteluun?:
PCV-10
PCV-13
Ei rokoteta

Haluatko lisäksi määritellä oman rokotteen?:

Oma rokote

Valitse serotyypit uuteen konjugaattirokotteeseen:
1
3
4
6A
6B
6C
7F
8
9N
9V
10
11
12
14
15
16
18C
19A
19F
20
22
23A
23F
33
35
38
Other

+ Näytä koodi

Funktioiden alustus

Mallissa käytetään samoja funktioita ja ovariableja kuin englanninkielisessä mallissa. Katso siis op_en:Epidemiological modelling#Initiate functions.

Data

Pneumokokin esiintyvyys suomalaisessa väestössä. Carrier: (oireettomien) kantajuusedpisodien lukumäärä vuodessa, Incidence: invasiivisten pneumokokkitautitapausten lukumäärä vuodessa.



Katso myös

Tämä rokotehankintakeskustelu toimitettiin tiedoksi kansalliselle rokotusasiantuntijaryhmälle 8.9.2014.

Pneumokokkirokotteen hankinta kansalliseen rokotusohjelmaan
Arvioinnin osat

ROKOTEKYSELY - VASTAA TÄSTÄ · Rokotteen vertailuperusteet · Epidemiologinen malli · Taloudellinen arviointi

Englanninkieliset sivut

Tendering process for pneumococcal conjugate vaccine · Comparison criteria for vaccine · Epidemiological modelling · Economic assessment

Taustatietoa

Pneumokokki · Työjärjestys · Pneumokokkirokotevalmisteet · Kansallinen rokotusohjelma · Pneumokokkikonjugaattirokotteen vaikuttavuuden seuranta · Korvautuminen · Viitteet · Herkkyysanalyysi(Tal.arv.) · Rokotesanasto · Pneumokokkirokotteen turvallisuus

Tulosta: Koko materiaali · Pneumokokkirokotekysely


Viitteet

  1. 1,0 1,1 Nurhonen M, Auranen K (2014) Optimal Serotype Compositions for Pneumococcal Conjugate Vaccination under Serotype Replacement. PLoS Computational Biology 10(2): e1003477. [1]

Kommentoi