Growth models estimated parameters value

Hi,
Using the below codes, I get the results as a figure. But I also need to see the estimated values of parameters just like the code shown as for "Model selection based on AICc:". Many thanks

library(FSA)
library(dplyr)
library(nlstools)
library(AICcmodavg)

bdmf <- read.csv("BlackDrum2001.csv")
select(-c(spname,day,weight))
filterD(sex %in% c("male","female"),otoage<100)
bdm <- filterD(bdmf,sex=="male")
headtail(bdm)

#Calculation of logistic, Gompertz and VonB

l1 <- logisticFuns()
g1 <- GompertzFuns()

plot(tl~otoage,data=bdm,pch=19,col=rgb(0,0,0,1/4),
xlab="Otolith Age",ylab="Total Length (cm)")
svR1 <- list(Linf=1200,k=0.1,a=1.1,b=0.4)

svG1 <- list(Linf=1250,gi=0.15,ti=2)
svL1 <- list(Linf=1250,gninf=0.15,ti=4)

vbTyp <- vbFuns()
svTyp <- list(Linf=1193,K=0.13,t0=-2.0)
fitTyp <- nls(tl~vbTyp(otoage,Linf,K,t0),data=bdm,start=svTyp)
fitG1 <- nls(tl~g1(otoage,Linf,gi,ti),data=bdm,start=svG1)
fitL1 <- nls(tl~l1(otoage,Linf,gninf,ti),data=bdm,start=svL1)

aictab(list(fitTyp,fitL1,fitG1),c("VBGF","logistic","Gompertz"))

plot(tl~otoage,data=bdm,pch=19,col=rgb(0,0,0,1/4),
xlab="Otolith Age",ylab="Total Length (cm)")
curve(vbTyp(x,coef(fitTyp)),from=-3,to=42,add=TRUE,lwd=2.5,col="blue")
curve(g1(x,coef(fitG1)),from=-3,to=42,add=TRUE,lwd=2.5,col="red")
curve(l1(x,coef(fitL1)),from=-3,to=42,add=TRUE,lwd=2.5,col="orange")

Excel data

This topic was automatically closed 21 days after the last reply. New replies are no longer allowed.

If you have a query related to it or one of the replies, start a new topic and refer back with a link.