Concentrations of beneficial nutrients in fish: Difference between revisions

From Opasnet
Jump to navigation Jump to search
(→‎Bayes calculations: multivariate normal works)
Line 315: Line 315:


* Model run 2.3.2017 [http://en.opasnet.org/en-opwiki/index.php?title=Special:RTools&id=9aXDKdIaq4jHrb7e]
* Model run 2.3.2017 [http://en.opasnet.org/en-opwiki/index.php?title=Special:RTools&id=9aXDKdIaq4jHrb7e]
* Model run 3.3.2017 with multivariate normal and predictions [http://en.opasnet.org/en-opwiki/index.php?title=Special:RTools&id=W4mWVsEdolRCeTet]


<rcode name="bayes" label="Initiate Bayes model (for developers only)" graphics=1>
<rcode name="bayes" label="Initiate Bayes model (for developers only)" graphics=1>
Line 323: Line 324:
library(reshape2)
library(reshape2)
library(ggplot2)
library(ggplot2)
library(car) # For scatterplotMatrix()


dat <- opbase.data("Op_en1838", subset = "Balticherring")
dat <- opbase.data("Op_en1838", subset = "Balticherring")
Line 330: Line 332:
fisl <- sort(unique(as.character(dat$Fish_species)))
fisl <- sort(unique(as.character(dat$Fish_species)))
compl <- sort(unique(as.character(dat$variable)))
compl <- sort(unique(as.character(dat$variable)))
dat.wide <- reshape(
  dat,
  idvar = "Sample_code",
  v.names = "Result",
  timevar = "variable",
  direction = "wide"
)


mod <- textConnection("
mod <- textConnection("
   model{
   model{
     for(i in 1:N) { # Observation
     for(i in 1:N) { # Observation
        conc[i] ~ dnorm(mu[comp[i]], tau[comp[i]]) # T(0, ) truncation gives bizarre results # Distributions are normal enough
      conc[i,1:C] ~ dmnorm(mu[], Omega[,])
    }
    for(i in 1:C) { # Compound
      mu[i] ~ dnorm(0, 0.0001)
      tau[i] ~ dgamma(0.001, 0.001)
      conc.pred[i] ~ dnorm(mu[i], tau[i])
     }
     }
    mu[1:C] ~ dmnorm(mu0[1:C], S2[1:C,1:C])
    Omega[1:C,1:C] ~ dwish(S3[1:C,1:C],4)
    conc.pred[1:C] ~ dmnorm(mu[1:C], Omega[1:C,1:C])
   }
   }
")
")
Line 347: Line 354:
   mod,
   mod,
   data = list(
   data = list(
     N = nrow(dat),
     N = nrow(dat.wide),
     C = length(compl),
     C = length(compl),
     conc = dat$Result,
     conc = dat.wide[ncol(dat.wide)+(-3:0)],
     comp = match(dat$variable, compl)
    mu0 = rep(100,4),
     S2 = diag(4)/100000,
    S3 = diag(4)/10000
   ),
   ),
   n.chains = 4,
   n.chains = 4,
Line 357: Line 366:


update(jags, 100)
update(jags, 100)
samps <- jags.samples(jags, c('mu', 'tau', 'conc.pred'), 1000)
samps <- jags.samples(jags, c('mu', 'Omega', 'conc.pred'), 1000)


concddeo <- array(
concddeo.mu <- array(
   samps$conc.pred,
   samps$mu,
   dim = c(length(compl), 1000, 4),
   dim = c(length(compl), 1000, 4),
   dimnames = list(Compound = compl, Iter = 1:1000, Seed = 1:4)
   dimnames = list(Compound = compl, Iter = 1:1000, Seed = 1:4)
)
)


concdf <- melt(concddeo)
concddeo.Omega <- array(
  samps$Omega,
  dim = c(length(compl), length(compl), 1000, 4),
  dimnames = list(Compound1 = compl, Compound2 = compl, Iter = 1:1000, Seed = 1:4)
)
 
concddeo.pred <- array(
  samps$mu,
  dim = c(length(compl), 1000, 4),
  dimnames = list(Compound = compl, Iter = 1:1000, Seed = 1:4)
)
 
concdf.mu <- melt(concddeo.mu)
 
scatterplotMatrix(t(concddeo.mu[,,1]))
 
concdf.pred <- melt(concddeo.pred)
 
scatterplotMatrix(t(concddeo.pred[,,1]))


ggplot(dat, aes(x = Result, colour = Fish_species))+geom_density()+
ggplot(dat, aes(x = Result, colour = Fish_species))+geom_density()+
   facet_wrap(~ variable, scales = "free")
   facet_wrap(~ variable, scales = "free")


ggplot(concdf, aes(x = value))+geom_density()+
ggplot(concdf.pred, aes(x = value))+geom_density()+
   facet_wrap(~ Compound, scales = "free")
   facet_wrap(~ Compound, scales = "free")


objects.store(concddeo)
objects.store(concddeo.mu, concddeo.Omega, concddeo.pred)
cat("Array concddeo (concentrations of vitamin D, DHA, EPA, and Omega3) stored.\n")
cat("Arrays of concentrations of vitamin D, DHA, EPA, and Omega3) stored:\n")
cat("concddeo.mu (mean), concddeo.Omega (precision matrix), concddeo.pred (predicted distribution).\n")
</rcode>
</rcode>



Revision as of 05:03, 3 March 2017



Scope

What are the concentrations of beneficial nutrients in fish (such as omega-3 fatty acids (EPA + DHA + fatty acid 18:3 n-3)) in fish.R↻ Concentrations of sea and freshwater fish species are studied separately.

Definition

Data

⇤--#: . Omega-3_content_in_salmon check this --Arja (talk) 07:11, 21 September 2016 (UTC) (type: truth; paradigms: science: attack)


Concentrations of beneficial nutrients in fish extracted from [1], where they are indicated as mass units/100 g fish analysed.

Concentrations of omega-3 fatty acids in fish extracted from [1], where they are indicated as mass units/100 g fish analysed. Criteria for choosing the fish preparation method used prior the analyses:

  1. one that is presumed as a common one used by the Finnish consumers (roasting), and
  2. also as available for most of the fish in the database.

The data for omega-3 fatty acids was reported as mean values of the fish species[2]. R↻

  • Omega-3 fatty acids, mg/g, as sum of n-3 PUFA (polyunsaturated fatty acids) precursors ALA (alphalinoleic acid), EPA (eicosapanthenic acid), and DHA (docosahexaenoic acid). DPA (docosapentaenoic acid) not available in the database.
  • Omega-3 fatty acids, mg/g, as DHA and EPA only.
    • Vitamin D, ug/g
    • Vitamin E, mg/g
    • Selenium, ug/g
    • Iodine, ug/g
    • Group B vitamins, mg/g, as sum of B1 (tiamin), B2 (riboflavin), B6 (pyridoxin), B12 (cyanokobalamin) and niacin as its eqvivalents NE. R↻

The most commonly consumed fish species are described: Farmed salmon, wild salmon, herring, white fish, sprat, perch, flounder, pike-perch, bream, pike, vendace and burbot. Concentration data for imported fish in Finland is not available in many cases. R↻


Data 1

mass units/100 g fish analysed

Fish species Omega-3-PUFA contents, mg/g Vitamin D, ug/g Vitamin E, mg/g Selenium, ug/g Iodine, ug/g Group B vitamins, mg/g,
Baltic herring (Clupea harengus membras) 12.13 0.17 0.03 0.18 0.45 0.17
Herring (Clupea harengus) 12.13 0.17 0.03 0.18 0.45 0.17
Vendace (Coregonus albula) 12.77 0.13 0.03 0.22 0.76 0.00
Whitefish (Coregonus lavaretus) 10.71
Pike (Esox lucius) 6.75 0.03 0.02 0.22 0.34 0.08
Rainbow trout (Onchorhynchus mykiss) 20.52
Shrimp (Pandalus sp.) 2.49
Perch (Perca fluviatilis) 7.17
Saithe (Pollachius virens) 3.87
Atlantic salmon (Salmo salar) 17.42
Pike-perch (Sander lucioperca) 4.06
Tuna (Thunnus thynnus) 32.67


Data 2

  • There are no separate data for farmed and for wild salmon. Therefore they are assumed to be the same.
  • There are no data for vendace(sea), so assumption is that the parameters are the same as vendace(inland)
  • There are no data for bream(sea), so assumption is that the parameters are the same as bream(inland)
  • There are no data for wild salmon(inland), so assumption is that the parameters are the same as wildsalmon(sea)

First, the mercury data was used to form lognormal distributions for each species with parameters median and geometric standard deviation. Secondly, the proportion of methylmercury from total mercury was taken into account. Methylmercury proportion is assumed to follow triangular distribution (author judgement) with parameters (min=0.81, mode=0.93,max=0,98). R↻

The omega-3 distributions chosen by author judgement. Concentration distributions were formed according to amount of data. a) If 3 or more data points → triangular distribution, b) if 2 data points → uniform distribution, c) if 1 data point → normal distribution R↻

Sprat: omega-3 concentration(sprat) = omega-3 concentration(herring) closely related species, assumed to have similar composition

Units: mg/kg in fresh weight

Fish species Omega-3 concentration
Farmed salmon (sea+inland) 1.553e+004
Wild salmon 1.516e+004
Herring(sea) 9790
White fish(sea) 7830
Sprat(sea) 9790
Perch(sea) 3030
Flounder(sea) 4220
Pike-perch(sea) 4060
Bream(sea) 4930
Pike(sea) 2920
Vendace(sea) 7510
Burbot(sea) 2010
Wild salmon(inland) 1.504e+004
White fish(inland) 7830
Perch(inland) 3030
Pike-perch(inland) 4060
Bream(inland) 4930
Pike(inland) 2920
Vendace(inland) 7510
Burbot(inland) 2010


Data 3

Since there are only mean concentration values available exponential distribution has been chosen to model the concentration of DHA and concentration of EPA in various sea and inland fish species.

Moreover, the Fineli database[1] provides concentrations of nutrients in species caught mostly in the Baltic Sea (except vendace which was caught in inland waters). Thus, the concentration data for some of the species chosen is not available. Therefore, it has been assumed that the DHA (EPA) concentration in sea and freshwater species is the same.

Units: mg/g fish

Fish species Mean DHA concentration Mean EPA concentration
Baltic Herring 4.82 2.27
Vendace(inland) 4.09 2.06
Vendace(sea) 4.09 2.06
Whitefish(inland) 4.93 2.63
Whitefish(sea) 4.93 2.63
Pike(inland) 2.17 0.44
Pike(sea) 2.17 0.44
Perch(inland) 2.45 0.54
Perch(sea) 2.45 0.54
Atlantic Salmon 10.02 3.45
Pike-perch(inland) 3.01 0.92
Pike-perch(sea) 3.01 0.92

Dependencies

List of parents:

  • None

Unit

mg/g fish

Formula

Previous Analytica formulas can be found from a previous version of this page.

Bayes calculations

  • Model run 2.3.2017 [3]
  • Model run 3.3.2017 with multivariate normal and predictions [4]

+ Show code

Result

Note! The first version of results only uses Data 3, for practical reasons (other nutrients than omega-3 are not yet needed).

{{#opasnet_base_link:Op_en1838}}


References

  1. 1.0 1.1 1.2 the Fineli database [1]
  2. Omega-3 fatty acids: database of fineli (www.ktlwww.ktl.fi/fineli)