Title: | Root Mean Square Curvature Calculation |
---|---|
Description: | Calculates the RMS intrinsic and parameter-effects curvatures of a nonlinear regression model. The curvatures are global measures of assessing whether a model/data set combination is close-to-linear or not. See Bates and Watts (1980) <doi:10.1002/9780470316757> and Ratkowsky and Reddy (2017) <doi:10.1093/aesa/saw098> for details. |
Authors: | Peijian Shi [aut, cre], Peter M. Ridland [aut], David A. Ratkowsky [aut], Yang Li [aut] |
Maintainer: | Peijian Shi <[email protected]> |
License: | GPL (>= 2) |
Version: | 1.1.0 |
Built: | 2024-11-09 06:10:09 UTC |
Source: | CRAN |
Calculates the RMS intrinsic and parameter-effects curvatures of a nonlinear regression model. The curvatures are global measures of assessing whether a model/data set combination is close-to-linear or not. See Bates and Watts (1980) and Ratkowsky and Reddy (2017) for details.
The DESCRIPTION file:
Package: | IPEC |
Type: | Package |
Title: | Root Mean Square Curvature Calculation |
Version: | 1.1.0 |
Date: | 2024-01-13 |
Authors@R: | c(person(given="Peijian", family="Shi", email="[email protected]", role=c("aut", "cre")), person(given=c("Peter M."), family="Ridland", email="[email protected]", role=c("aut")), person(given=c("David A."), family="Ratkowsky", email="[email protected]", role=c("aut")), person(given=c("Yang"), family="Li", email="[email protected]", role=c("aut"))) |
Author: | Peijian Shi [aut, cre], Peter M. Ridland [aut], David A. Ratkowsky [aut], Yang Li [aut] |
Maintainer: | Peijian Shi <[email protected]> |
Imports: | numDeriv (>= 2016.8-1.1), MASS |
Description: | Calculates the RMS intrinsic and parameter-effects curvatures of a nonlinear regression model. The curvatures are global measures of assessing whether a model/data set combination is close-to-linear or not. See Bates and Watts (1980) <doi:10.1002/9780470316757> and Ratkowsky and Reddy (2017) <doi:10.1093/aesa/saw098> for details. |
Depends: | R (>= 4.2.0) |
License: | GPL (>= 2) |
NeedsCompilation: | no |
Packaged: | 2024-01-13 16:32:45 UTC; PEIJIAN SHI |
Repository: | CRAN |
Date/Publication: | 2024-01-13 16:50:02 UTC |
Index of help topics:
IPEC-package Root Mean Square Curvature Calculation aic Akaike Information Criterion (AIC) Calculation Function biasIPEC Bias Calculation Function bic Bayesian Information Criterion (BIC) Calculation Function bootIPEC Bootstrap Function for Nonlinear Regression confcurves Wald Confidence Curves and the Likelihood Confidence Curves crops Whole-plant biomass Data of 12 Species of Crops curvIPEC RMS Curvature Calculation Function derivIPEC Derivative Calculation Function fitIPEC Nonlinear Fitting Function isom Data on Biochemical Oxygen Demand leaves Leaf Data of _Parrotia subaequalis_ (Hamamelidaceae) parinfo Detailed Information of Estimated Model Parameters shoots Height Growth Data of Bamboo Shoots skewIPEC Skewness Calculation Function
We are deeply thankful to Paul Gilbert and Jinlong Zhang for their invaluable help during creating this package. We also thank Linli Deng, Kurt Hornik and Lin Wang for their statistical and technical guidance in updating the package.
Peijian Shi [aut, cre], Peter Ridland [aut], David A. Ratkowsky [aut], Yang Li [aut]
Maintainer: Peijian Shi <[email protected]>
Bates, D.M and Watts, D.G. (1988) Nonlinear Regression Analysis and its Applications. Wiley, New York. doi:10.1002/9780470316757
Ratkowsky, D.A. (1983) Nonlinear Regression Modeling: A Unified Practical Approach. Marcel Dekker, New York.
Ratkowsky, D.A. (1990) Handbook of Nonlinear Regression Models, Marcel Dekker, New York.
Ratkowsky, D.A. & Reddy, G.V.P. (2017) Empirical model with excellent statistical properties for describing temperature-dependent
developmental rates of insects and mites. Ann. Entomol. Soc. Am. 110, 302309. doi:10.1093/aesa/saw098
hessian
in package numDeriv, jacobian
in package numDeriv, rms.curv
in package MASS
#### Example 1 ################################################################################## graphics.off() # The velocity of the reaction (counts/min^2) under different substrate concentrations # in parts per million (ppm) (Page 269 of Bates and Watts 1988) x1 <- c(0.02, 0.02, 0.06, 0.06, 0.11, 0.11, 0.22, 0.22, 0.56, 0.56, 1.10, 1.10) y1 <- c(76, 47, 97, 107, 123, 139, 159, 152, 191, 201, 207, 200) # Define the Michaelis-Menten model MM <- function(theta, x){ theta[1]*x / ( theta[2] + x ) } res0 <- fitIPEC( MM, x=x1, y=y1, ini.val=c(200, 0.05), xlim=c( 0, 1.5 ), ylim=c(0, 250), fig.opt=TRUE ) par1 <- res0$par par1 res1 <- derivIPEC( MM, theta=par1, z=x1[1], method="Richardson", method.args=list(eps=1e-4, d=0.11, zero.tol=sqrt(.Machine$double.eps/7e-7), r=6, v=2) ) res1 # To calculate curvatures res2 <- curvIPEC( MM, theta=par1, x=x1, y=y1, alpha=0.05, method="Richardson", method.args=list(eps=1e-4, d=0.11, zero.tol=sqrt(.Machine$double.eps/7e-7), r=6, v=2) ) res2 # To calculate bias res3 <- biasIPEC(MM, theta=par1, x=x1, y=y1, tol= 1e-20) res3 set.seed(123) res4 <- bootIPEC( MM, x=x1, y=y1, ini.val=par1, control=list(reltol=1e-20, maxit=40000), nboot=2000, CI=0.95, fig.opt=TRUE ) res4 set.seed(NULL) # To calculate skewness res5 <- skewIPEC(MM, theta=par1, x=x1, y=y1, tol= 1e-20) res5 ################################################################################################# #### Example 2 ################################################################################## graphics.off() # Development data of female pupae of cotton bollworm (Wu et al. 2009) # References: # Ratkowsky, D.A. and Reddy, G.V.P. (2017) Empirical model with excellent statistical # properties for describing temperature-dependent developmental rates of insects # and mites. Ann. Entomol. Soc. Am. 110, 302-309. # Wu, K., Gong, P. and Ruan, Y. (2009) Estimating developmental rates of # Helicoverpa armigera (Lepidoptera: Noctuidae) pupae at constant and # alternating temperature by nonlinear models. Acta Entomol. Sin. 52, 640-650. # 'x2' is the vector of temperature (in degrees Celsius) # 'D2' is the vector of developmental duration (in d) # 'y2' is the vector of the square root of developmental rate (in 1/d) x2 <- seq(15, 37, by=1) D2 <- c(41.24,37.16,32.47,26.22,22.71,19.01,16.79,15.63,14.27,12.48, 11.3,10.56,9.69,9.14,8.24,8.02,7.43,7.27,7.35,7.49,7.63,7.9,10.03) y2 <- 1/D2 y2 <- sqrt( y2 ) ini.val1 <- c(0.14, 30, 10, 40) # Define the square root function of the Lobry-Rosso-Flandrois (LRF) model sqrt.LRF <- function(P, x){ ropt <- P[1] Topt <- P[2] Tmin <- P[3] Tmax <- P[4] fun0 <- function(z){ z[z < Tmin] <- Tmin z[z > Tmax] <- Tmax return(z) } x <- fun0(x) if (Tmin >= Tmax | ropt <= 0 | Topt <= Tmin | Topt >= Tmax) temp <- Inf if (Tmax > Tmin & ropt > 0 & Topt > Tmin & Topt < Tmax){ temp <- sqrt( ropt*(x-Tmax)*(x-Tmin)^2/((Topt-Tmin)*((Topt-Tmin )*(x-Topt)-(Topt-Tmax)*(Topt+Tmin-2*x))) ) } return( temp ) } myfun <- sqrt.LRF xlab1 <- expression( paste("Temperature (", degree, "C)", sep="" ) ) ylab1 <- expression( paste("Developmental rate"^{1/2}, " (", d^{"-1"}, ")", sep="") ) resu0 <- fitIPEC( myfun, x=x2, y=y2, ini.val=ini.val1, xlim=NULL, ylim=NULL, xlab=xlab1, ylab=ylab1, fig.opt=TRUE, control=list(trace=FALSE, reltol=1e-20, maxit=50000) ) par2 <- resu0$par par2 resu1 <- derivIPEC( myfun, theta=par2, z=x2[1], method="Richardson", method.args=list(eps=1e-4, d=0.11, zero.tol=sqrt(.Machine$double.eps/7e-7), r=6, v=2) ) resu1 # To calculate curvatures resu2 <- curvIPEC( myfun, theta=par2, x=x2, y=y2, alpha=0.05, method="Richardson", method.args=list(eps=1e-4, d=0.11, zero.tol=sqrt(.Machine$double.eps/7e-7), r=6, v=2) ) resu2 # To calculate bias resu3 <- biasIPEC(myfun, theta=par2, x=x2, y=y2, tol= 1e-20) resu3 set.seed(123) resu4 <- bootIPEC( myfun, x=x2, y=y2, ini.val=ini.val1, nboot=2000, CI=0.95, fig.opt=TRUE ) resu4 set.seed(NULL) # To calculate skewness resu5 <- skewIPEC(myfun, theta=par2, x=x2, y=y2, tol= 1e-20) resu5 ################################################################################################# #### Example 3 ################################################################################## graphics.off() # Height growth data of four species of bamboo (Gramineae: Bambusoideae) # Reference(s): # Shi, P., Fan, M., Ratkowsky, D.A., Huang, J., Wu, H., Chen, L., Fang, S. and # Zhang, C. (2017) Comparison of two ontogenetic growth equations for animals and plants. # Ecol. Model. 349, 1-10. data(shoots) # Choose a species # 1: Phyllostachys iridescens; 2: Phyllostachys mannii; # 3: Pleioblastus maculatus; 4: Sinobambusa tootsik. # 'x3' is the vector of the investigation times from a specific starting time of growth # 'y3' is the vector of the aboveground height values of bamboo shoots at 'x3' ind <- 4 x3 <- shoots$x[shoots$Code == ind] y3 <- shoots$y[shoots$Code == ind] # Define the beta sigmoid model (bsm) bsm <- function(P, x){ P <- cbind(P) if(length(P) !=4 ) {stop("The number of parameters should be 4!")} ropt <- P[1] topt <- P[2] tmin <- P[3] tmax <- P[4] tailor.fun <- function(x){ x[x < tmin] <- tmin x[x > tmax] <- tmax return(x) } x <- tailor.fun(x) ropt*(x-tmin)*(x-2*tmax+topt)/(topt+tmin-2*tmax)*( (x-tmin)/(topt-tmin) )^((topt-tmin)/(tmax-topt)) } # Define the simplified beta sigmoid model (simp.bsm) simp.bsm <- function(P, x, tmin=0){ P <- cbind(P) ropt <- P[1] topt <- P[2] tmax <- P[3] tailor.fun <- function(x){ x[x < tmin] <- tmin x[x > tmax] <- tmax return(x) } x <- tailor.fun(x) ropt*(x-tmin)*(x-2*tmax+topt)/(topt+tmin-2*tmax)* ((x-tmin)/(topt-tmin))^((topt-tmin)/(tmax-topt)) } # For the original beta sigmoid model ini.val2 <- c(40, 30, 5, 50) xlab2 <- "Time (d)" ylab2 <- "Height (cm)" re0 <- fitIPEC( bsm, x=x3, y=y3, ini.val=ini.val2, xlim=NULL, ylim=NULL, xlab=xlab2, ylab=ylab2, fig.opt=TRUE, control=list(trace=FALSE, reltol=1e-20, maxit=50000) ) par3 <- re0$par par3 re1 <- derivIPEC( bsm, theta=par3, x3[15], method="Richardson", method.args=list(eps=1e-4, d=0.11, zero.tol= sqrt(.Machine$double.eps/7e-7), r=6, v=2) ) re1 re2 <- curvIPEC( bsm, theta=par3, x=x3, y=y3, alpha=0.05, method="Richardson", method.args=list(eps=1e-4, d=0.11, zero.tol= sqrt(.Machine$double.eps/7e-7), r=6, v=2) ) re2 re3 <- biasIPEC( bsm, theta=par3, x=x3, y=y3, tol= 1e-20 ) re3 re4 <- bootIPEC( bsm, x=x3, y=y3, ini.val=ini.val2, control=list(trace=FALSE, reltol=1e-20, maxit=50000), nboot=2000, CI=0.95, fig.opt=TRUE, fold=3.5 ) re4 re5 <- skewIPEC( bsm, theta=par3, x=x3, y=y3, tol= 1e-20 ) re5 # For the simplified beta sigmoid model # (in comparison with the original beta sigmoid model) ini.val7 <- c(40, 30, 50) RESU0 <- fitIPEC( simp.bsm, x=x3, y=y3, ini.val=ini.val7, xlim=NULL, ylim=NULL, xlab=xlab2, ylab=ylab2, fig.opt=TRUE, control=list(trace=FALSE, reltol=1e-20, maxit=50000) ) par7 <- RESU0$par par7 RESU1 <- derivIPEC( simp.bsm, theta=par7, x3[15], method="Richardson", method.args=list(eps=1e-4, d=0.11, zero.tol=sqrt(.Machine$double.eps/7e-7), r=6, v=2) ) RESU1 RESU2 <- curvIPEC( simp.bsm, theta=par7, x=x3, y=y3, alpha=0.05, method="Richardson", method.args=list(eps=1e-4, d=0.11, zero.tol=sqrt(.Machine$double.eps/7e-7), r=6, v=2) ) RESU2 RESU3 <- biasIPEC( simp.bsm, theta=par7, x=x3, y=y3, tol= 1e-20 ) RESU3 set.seed(123) RESU4 <- bootIPEC( simp.bsm, x=x3, y=y3, ini.val=ini.val7, control=list(trace=FALSE, reltol=1e-20, maxit=50000), nboot=2000, CI=0.95, fig.opt=TRUE, fold=3.5 ) RESU4 set.seed(NULL) RESU5 <- skewIPEC( simp.bsm, theta=par7, x=x3, y=y3, tol= 1e-20 ) RESU5 ################################################################################################## #### Example 4 ################################################################################### # Data on biochemical oxygen demand (BOD; Marske 1967) # References: # Pages 56, 255 and 271 in Bates and Watts (1988) # Carr, N.L. (1960) Kinetics of catalytic isomerization of n-pentane. Ind. Eng. Chem. # 52, 391-396. graphics.off() data(isom) Y <- isom[,1] X <- isom[,2:4] # There are three independent variables saved in matrix 'X' and one response variable (Y) # The first column of 'X' is the vector of partial pressure of hydrogen # The second column of 'X' is the vector of partial pressure of n-pentane # The third column of 'X' is the vector of partial pressure of isopentane # Y is the vector of experimental reaction rate (in 1/hr) isom.fun <- function(theta, x){ x1 <- x[,1] x2 <- x[,2] x3 <- x[,3] theta1 <- theta[1] theta2 <- theta[2] theta3 <- theta[3] theta4 <- theta[4] theta1*theta3*(x2-x3/1.632) / ( 1 + theta2*x1 + theta3*x2 + theta4*x3 ) } ini.val8 <- c(35, 0.1, 0.05, 0.2) cons1 <- fitIPEC( isom.fun, x=X, y=Y, ini.val=ini.val8, control=list( trace=FALSE, reltol=1e-20, maxit=50000) ) par8 <- cons1$par cons2 <- curvIPEC( isom.fun, theta=par8, x=X, y=Y, alpha=0.05, method="Richardson", method.args=list(eps=1e-4, d=0.11, zero.tol=sqrt(.Machine$double.eps/7e-7), r=6, v=2)) cons2 cons3 <- biasIPEC( isom.fun, theta=par8, x=X, y=Y, tol= 1e-20 ) cons3 set.seed(123) cons4 <- bootIPEC( isom.fun, x=X, y=Y, ini.val=ini.val8, control=list(trace=FALSE, reltol=1e-20, maxit=50000), nboot=2000, CI=0.95, fig.opt=TRUE, fold=10000 ) cons4 set.seed(NULL) cons5 <- skewIPEC( isom.fun, theta=par8, x=X, y=Y, tol= 1e-20 ) cons5 ##################################################################################################
#### Example 1 ################################################################################## graphics.off() # The velocity of the reaction (counts/min^2) under different substrate concentrations # in parts per million (ppm) (Page 269 of Bates and Watts 1988) x1 <- c(0.02, 0.02, 0.06, 0.06, 0.11, 0.11, 0.22, 0.22, 0.56, 0.56, 1.10, 1.10) y1 <- c(76, 47, 97, 107, 123, 139, 159, 152, 191, 201, 207, 200) # Define the Michaelis-Menten model MM <- function(theta, x){ theta[1]*x / ( theta[2] + x ) } res0 <- fitIPEC( MM, x=x1, y=y1, ini.val=c(200, 0.05), xlim=c( 0, 1.5 ), ylim=c(0, 250), fig.opt=TRUE ) par1 <- res0$par par1 res1 <- derivIPEC( MM, theta=par1, z=x1[1], method="Richardson", method.args=list(eps=1e-4, d=0.11, zero.tol=sqrt(.Machine$double.eps/7e-7), r=6, v=2) ) res1 # To calculate curvatures res2 <- curvIPEC( MM, theta=par1, x=x1, y=y1, alpha=0.05, method="Richardson", method.args=list(eps=1e-4, d=0.11, zero.tol=sqrt(.Machine$double.eps/7e-7), r=6, v=2) ) res2 # To calculate bias res3 <- biasIPEC(MM, theta=par1, x=x1, y=y1, tol= 1e-20) res3 set.seed(123) res4 <- bootIPEC( MM, x=x1, y=y1, ini.val=par1, control=list(reltol=1e-20, maxit=40000), nboot=2000, CI=0.95, fig.opt=TRUE ) res4 set.seed(NULL) # To calculate skewness res5 <- skewIPEC(MM, theta=par1, x=x1, y=y1, tol= 1e-20) res5 ################################################################################################# #### Example 2 ################################################################################## graphics.off() # Development data of female pupae of cotton bollworm (Wu et al. 2009) # References: # Ratkowsky, D.A. and Reddy, G.V.P. (2017) Empirical model with excellent statistical # properties for describing temperature-dependent developmental rates of insects # and mites. Ann. Entomol. Soc. Am. 110, 302-309. # Wu, K., Gong, P. and Ruan, Y. (2009) Estimating developmental rates of # Helicoverpa armigera (Lepidoptera: Noctuidae) pupae at constant and # alternating temperature by nonlinear models. Acta Entomol. Sin. 52, 640-650. # 'x2' is the vector of temperature (in degrees Celsius) # 'D2' is the vector of developmental duration (in d) # 'y2' is the vector of the square root of developmental rate (in 1/d) x2 <- seq(15, 37, by=1) D2 <- c(41.24,37.16,32.47,26.22,22.71,19.01,16.79,15.63,14.27,12.48, 11.3,10.56,9.69,9.14,8.24,8.02,7.43,7.27,7.35,7.49,7.63,7.9,10.03) y2 <- 1/D2 y2 <- sqrt( y2 ) ini.val1 <- c(0.14, 30, 10, 40) # Define the square root function of the Lobry-Rosso-Flandrois (LRF) model sqrt.LRF <- function(P, x){ ropt <- P[1] Topt <- P[2] Tmin <- P[3] Tmax <- P[4] fun0 <- function(z){ z[z < Tmin] <- Tmin z[z > Tmax] <- Tmax return(z) } x <- fun0(x) if (Tmin >= Tmax | ropt <= 0 | Topt <= Tmin | Topt >= Tmax) temp <- Inf if (Tmax > Tmin & ropt > 0 & Topt > Tmin & Topt < Tmax){ temp <- sqrt( ropt*(x-Tmax)*(x-Tmin)^2/((Topt-Tmin)*((Topt-Tmin )*(x-Topt)-(Topt-Tmax)*(Topt+Tmin-2*x))) ) } return( temp ) } myfun <- sqrt.LRF xlab1 <- expression( paste("Temperature (", degree, "C)", sep="" ) ) ylab1 <- expression( paste("Developmental rate"^{1/2}, " (", d^{"-1"}, ")", sep="") ) resu0 <- fitIPEC( myfun, x=x2, y=y2, ini.val=ini.val1, xlim=NULL, ylim=NULL, xlab=xlab1, ylab=ylab1, fig.opt=TRUE, control=list(trace=FALSE, reltol=1e-20, maxit=50000) ) par2 <- resu0$par par2 resu1 <- derivIPEC( myfun, theta=par2, z=x2[1], method="Richardson", method.args=list(eps=1e-4, d=0.11, zero.tol=sqrt(.Machine$double.eps/7e-7), r=6, v=2) ) resu1 # To calculate curvatures resu2 <- curvIPEC( myfun, theta=par2, x=x2, y=y2, alpha=0.05, method="Richardson", method.args=list(eps=1e-4, d=0.11, zero.tol=sqrt(.Machine$double.eps/7e-7), r=6, v=2) ) resu2 # To calculate bias resu3 <- biasIPEC(myfun, theta=par2, x=x2, y=y2, tol= 1e-20) resu3 set.seed(123) resu4 <- bootIPEC( myfun, x=x2, y=y2, ini.val=ini.val1, nboot=2000, CI=0.95, fig.opt=TRUE ) resu4 set.seed(NULL) # To calculate skewness resu5 <- skewIPEC(myfun, theta=par2, x=x2, y=y2, tol= 1e-20) resu5 ################################################################################################# #### Example 3 ################################################################################## graphics.off() # Height growth data of four species of bamboo (Gramineae: Bambusoideae) # Reference(s): # Shi, P., Fan, M., Ratkowsky, D.A., Huang, J., Wu, H., Chen, L., Fang, S. and # Zhang, C. (2017) Comparison of two ontogenetic growth equations for animals and plants. # Ecol. Model. 349, 1-10. data(shoots) # Choose a species # 1: Phyllostachys iridescens; 2: Phyllostachys mannii; # 3: Pleioblastus maculatus; 4: Sinobambusa tootsik. # 'x3' is the vector of the investigation times from a specific starting time of growth # 'y3' is the vector of the aboveground height values of bamboo shoots at 'x3' ind <- 4 x3 <- shoots$x[shoots$Code == ind] y3 <- shoots$y[shoots$Code == ind] # Define the beta sigmoid model (bsm) bsm <- function(P, x){ P <- cbind(P) if(length(P) !=4 ) {stop("The number of parameters should be 4!")} ropt <- P[1] topt <- P[2] tmin <- P[3] tmax <- P[4] tailor.fun <- function(x){ x[x < tmin] <- tmin x[x > tmax] <- tmax return(x) } x <- tailor.fun(x) ropt*(x-tmin)*(x-2*tmax+topt)/(topt+tmin-2*tmax)*( (x-tmin)/(topt-tmin) )^((topt-tmin)/(tmax-topt)) } # Define the simplified beta sigmoid model (simp.bsm) simp.bsm <- function(P, x, tmin=0){ P <- cbind(P) ropt <- P[1] topt <- P[2] tmax <- P[3] tailor.fun <- function(x){ x[x < tmin] <- tmin x[x > tmax] <- tmax return(x) } x <- tailor.fun(x) ropt*(x-tmin)*(x-2*tmax+topt)/(topt+tmin-2*tmax)* ((x-tmin)/(topt-tmin))^((topt-tmin)/(tmax-topt)) } # For the original beta sigmoid model ini.val2 <- c(40, 30, 5, 50) xlab2 <- "Time (d)" ylab2 <- "Height (cm)" re0 <- fitIPEC( bsm, x=x3, y=y3, ini.val=ini.val2, xlim=NULL, ylim=NULL, xlab=xlab2, ylab=ylab2, fig.opt=TRUE, control=list(trace=FALSE, reltol=1e-20, maxit=50000) ) par3 <- re0$par par3 re1 <- derivIPEC( bsm, theta=par3, x3[15], method="Richardson", method.args=list(eps=1e-4, d=0.11, zero.tol= sqrt(.Machine$double.eps/7e-7), r=6, v=2) ) re1 re2 <- curvIPEC( bsm, theta=par3, x=x3, y=y3, alpha=0.05, method="Richardson", method.args=list(eps=1e-4, d=0.11, zero.tol= sqrt(.Machine$double.eps/7e-7), r=6, v=2) ) re2 re3 <- biasIPEC( bsm, theta=par3, x=x3, y=y3, tol= 1e-20 ) re3 re4 <- bootIPEC( bsm, x=x3, y=y3, ini.val=ini.val2, control=list(trace=FALSE, reltol=1e-20, maxit=50000), nboot=2000, CI=0.95, fig.opt=TRUE, fold=3.5 ) re4 re5 <- skewIPEC( bsm, theta=par3, x=x3, y=y3, tol= 1e-20 ) re5 # For the simplified beta sigmoid model # (in comparison with the original beta sigmoid model) ini.val7 <- c(40, 30, 50) RESU0 <- fitIPEC( simp.bsm, x=x3, y=y3, ini.val=ini.val7, xlim=NULL, ylim=NULL, xlab=xlab2, ylab=ylab2, fig.opt=TRUE, control=list(trace=FALSE, reltol=1e-20, maxit=50000) ) par7 <- RESU0$par par7 RESU1 <- derivIPEC( simp.bsm, theta=par7, x3[15], method="Richardson", method.args=list(eps=1e-4, d=0.11, zero.tol=sqrt(.Machine$double.eps/7e-7), r=6, v=2) ) RESU1 RESU2 <- curvIPEC( simp.bsm, theta=par7, x=x3, y=y3, alpha=0.05, method="Richardson", method.args=list(eps=1e-4, d=0.11, zero.tol=sqrt(.Machine$double.eps/7e-7), r=6, v=2) ) RESU2 RESU3 <- biasIPEC( simp.bsm, theta=par7, x=x3, y=y3, tol= 1e-20 ) RESU3 set.seed(123) RESU4 <- bootIPEC( simp.bsm, x=x3, y=y3, ini.val=ini.val7, control=list(trace=FALSE, reltol=1e-20, maxit=50000), nboot=2000, CI=0.95, fig.opt=TRUE, fold=3.5 ) RESU4 set.seed(NULL) RESU5 <- skewIPEC( simp.bsm, theta=par7, x=x3, y=y3, tol= 1e-20 ) RESU5 ################################################################################################## #### Example 4 ################################################################################### # Data on biochemical oxygen demand (BOD; Marske 1967) # References: # Pages 56, 255 and 271 in Bates and Watts (1988) # Carr, N.L. (1960) Kinetics of catalytic isomerization of n-pentane. Ind. Eng. Chem. # 52, 391-396. graphics.off() data(isom) Y <- isom[,1] X <- isom[,2:4] # There are three independent variables saved in matrix 'X' and one response variable (Y) # The first column of 'X' is the vector of partial pressure of hydrogen # The second column of 'X' is the vector of partial pressure of n-pentane # The third column of 'X' is the vector of partial pressure of isopentane # Y is the vector of experimental reaction rate (in 1/hr) isom.fun <- function(theta, x){ x1 <- x[,1] x2 <- x[,2] x3 <- x[,3] theta1 <- theta[1] theta2 <- theta[2] theta3 <- theta[3] theta4 <- theta[4] theta1*theta3*(x2-x3/1.632) / ( 1 + theta2*x1 + theta3*x2 + theta4*x3 ) } ini.val8 <- c(35, 0.1, 0.05, 0.2) cons1 <- fitIPEC( isom.fun, x=X, y=Y, ini.val=ini.val8, control=list( trace=FALSE, reltol=1e-20, maxit=50000) ) par8 <- cons1$par cons2 <- curvIPEC( isom.fun, theta=par8, x=X, y=Y, alpha=0.05, method="Richardson", method.args=list(eps=1e-4, d=0.11, zero.tol=sqrt(.Machine$double.eps/7e-7), r=6, v=2)) cons2 cons3 <- biasIPEC( isom.fun, theta=par8, x=X, y=Y, tol= 1e-20 ) cons3 set.seed(123) cons4 <- bootIPEC( isom.fun, x=X, y=Y, ini.val=ini.val8, control=list(trace=FALSE, reltol=1e-20, maxit=50000), nboot=2000, CI=0.95, fig.opt=TRUE, fold=10000 ) cons4 set.seed(NULL) cons5 <- skewIPEC( isom.fun, theta=par8, x=X, y=Y, tol= 1e-20 ) cons5 ##################################################################################################
Calculates the AIC value(s) of the object(s) obtained from
using the fitIPEC
function.
aic( object, ... )
aic( object, ... )
object |
A fitted model object for which there exists the sample size ( |
... |
Optionally more fitted model objects |
AIC = 2 p - 2 ln(L), where p represents the number of model parameter(s) plus 1 for the error, and ln(L) represents the maximum log-likelihood of the estimated model (Spiess and Neumeyer, 2010).
There is an AIC value corresponding to one object, and there is a vector of AIC values corresponding to the multiple objects.
When there are sample.size
and n
in object
at the same time, the default of
the sample size is sample.size
, which is superior to n
.
With the sample size increasing, the number of model parameter(s) has a weaker
influence on the value of AIC assuming that ln(RSS/n
) is a constant.
Peijian Shi [email protected], Peter M. Ridland [email protected], David A. Ratkowsky [email protected], Yang Li [email protected].
Spiess, A-N and Neumeyer, N. (2010) An evaluation of R squared as an inadequate measure for nonlinear models in pharmacological and biochemical research: a Monte Carlo approach. BMC Pharmacol. 10, 6. doi:10.1186/1471-2210-10-6
bic
, AIC
in package stats, and BIC
in package stats
#### Example ##################################################################################### data(leaves) attach(leaves) # Choose a geographical population (see Table S1 in Wang et al. [2018] for details) # Wang, P., Ratkowsky, D.A., Xiao, X., Yu, X., Su, J., Zhang, L. and Shi, P. # (2018) Taylor's power law for leaf bilateral symmetry. Forests 9, 500. doi: 10.3390/f9080500 # 1: AJ; 2: HN; 3: HW; 4: HZ; 5: JD; # 6: JS; 7: SC; 8: TC; 9: TT; 10: TX ind <- 1 L <- Length[PopuCode == ind] W <- Width[PopuCode == ind] A <- Area[PopuCode == ind] # Define a model y = a*(x1*x2), where a is a parameter to be estimated propor <- function(theta, x){ a <- theta[1] x1 <- x[,1] x2 <- x[,2] a*x1*x2 } # Define a model y = a*(x1^b)*(x2^c), where a, b and c are parameters to be estimated threepar <- function(theta, x){ a <- theta[1] b <- theta[2] c <- theta[3] x1 <- x[,1] x2 <- x[,2] a*x1^b*x2^c } # Define a model y = a*x^b, where a and b are parameters to be estimated twopar <- function(theta, x){ a <- theta[1] b <- theta[2] a*x^b } A1 <- fitIPEC(propor, x=cbind(L, W), y=A, fig.opt=FALSE, ini.val=list(seq(0.1, 1.5, by=0.1))) B1 <- curvIPEC(propor, theta=A1$par, x=cbind(L, W), y=A) A2 <- fitIPEC(threepar, x=cbind(L, W), y=A, fig.opt=FALSE, ini.val=list(A1$par, seq(0.5, 1.5, by=0.1), seq(0.5, 1.5, by=0.1))) B2 <- curvIPEC(threepar, theta=A2$par, x=cbind(L, W), y=A) A3 <- fitIPEC(twopar, x=L, y=A, fig.opt=FALSE, ini.val=list(1, seq(0.5, 1.5, by=0.05))) B3 <- curvIPEC(twopar, theta=A3$par, x=L, y=A) A4 <- fitIPEC(twopar, x=W, y=A, fig.opt=FALSE, ini.val=list(1, seq(0.5, 1.5, by=0.05))) B4 <- curvIPEC(twopar, theta=A4$par, x=W, y=A) aic(A1, A2, A3, A4) bic(A1, A2, A3, A4) ##################################################################################################
#### Example ##################################################################################### data(leaves) attach(leaves) # Choose a geographical population (see Table S1 in Wang et al. [2018] for details) # Wang, P., Ratkowsky, D.A., Xiao, X., Yu, X., Su, J., Zhang, L. and Shi, P. # (2018) Taylor's power law for leaf bilateral symmetry. Forests 9, 500. doi: 10.3390/f9080500 # 1: AJ; 2: HN; 3: HW; 4: HZ; 5: JD; # 6: JS; 7: SC; 8: TC; 9: TT; 10: TX ind <- 1 L <- Length[PopuCode == ind] W <- Width[PopuCode == ind] A <- Area[PopuCode == ind] # Define a model y = a*(x1*x2), where a is a parameter to be estimated propor <- function(theta, x){ a <- theta[1] x1 <- x[,1] x2 <- x[,2] a*x1*x2 } # Define a model y = a*(x1^b)*(x2^c), where a, b and c are parameters to be estimated threepar <- function(theta, x){ a <- theta[1] b <- theta[2] c <- theta[3] x1 <- x[,1] x2 <- x[,2] a*x1^b*x2^c } # Define a model y = a*x^b, where a and b are parameters to be estimated twopar <- function(theta, x){ a <- theta[1] b <- theta[2] a*x^b } A1 <- fitIPEC(propor, x=cbind(L, W), y=A, fig.opt=FALSE, ini.val=list(seq(0.1, 1.5, by=0.1))) B1 <- curvIPEC(propor, theta=A1$par, x=cbind(L, W), y=A) A2 <- fitIPEC(threepar, x=cbind(L, W), y=A, fig.opt=FALSE, ini.val=list(A1$par, seq(0.5, 1.5, by=0.1), seq(0.5, 1.5, by=0.1))) B2 <- curvIPEC(threepar, theta=A2$par, x=cbind(L, W), y=A) A3 <- fitIPEC(twopar, x=L, y=A, fig.opt=FALSE, ini.val=list(1, seq(0.5, 1.5, by=0.05))) B3 <- curvIPEC(twopar, theta=A3$par, x=L, y=A) A4 <- fitIPEC(twopar, x=W, y=A, fig.opt=FALSE, ini.val=list(1, seq(0.5, 1.5, by=0.05))) B4 <- curvIPEC(twopar, theta=A4$par, x=W, y=A) aic(A1, A2, A3, A4) bic(A1, A2, A3, A4) ##################################################################################################
Calculates the bias in the estimates of the parameters of a given nonlinear regression model.
biasIPEC(expr, theta, x, y, tol = 1e-16, method = "Richardson", method.args = list(eps = 1e-04, d = 0.11, zero.tol = sqrt(.Machine$double.eps/7e-07), r = 6, v = 2, show.details = FALSE), side = NULL)
biasIPEC(expr, theta, x, y, tol = 1e-16, method = "Richardson", method.args = list(eps = 1e-04, d = 0.11, zero.tol = sqrt(.Machine$double.eps/7e-07), r = 6, v = 2, show.details = FALSE), side = NULL)
expr |
A given nonlinear regression model |
theta |
A vector of parameters of the model |
x |
A vector or matrix of observations of independent variable(s) |
y |
A vector of observations of response variable |
tol |
The tolerance for detecting linear dependencies in the columns of a matrix for calculating its inverse.
See the input argument of |
method |
It is the same as the input argument of |
method.args |
It is the same as the input argument of |
side |
It is the same as the input argument of |
The defined model should have two input arguments: a parameter vector and an independent variable vector or matrix,
e.g. myfun <- function(P, x){...}
, where P
represents the parameter vector and x
represents the independent variable vector or matrix.
An absolute value of percent.bias
(see below) in excess of 1% appears to be a good rule of thumb for indicating nonlinear behavior (Ratkowsky 1983).
bias |
The bias |
percent.bias |
The percentage bias that is equal to |
The current function can be applicable to nonlinear models with multiple independent variables.
Peijian Shi [email protected], Peter M. Ridland [email protected], David A. Ratkowsky [email protected], Yang Li [email protected].
Box, M.J. (1971) Bias in nonlinear estimation. J. R. Statist. Soc., Ser. B 33, 171201.
doi:10.1111/j.2517-6161.1971.tb00871.x
Ratkowsky, D.A. (1983) Nonlinear Regression Modeling: A Unified Practical Approach. Marcel Dekker, New York.
derivIPEC
, hessian
in package numDeriv, jacobian
in package numDeriv
#### Example 1 ################################################################################# # The velocity of the reaction (counts/min^2) under different substrate concentrations # in parts per million (ppm) (Page 269 of Bates and Watts 1988) x1 <- c(0.02, 0.02, 0.06, 0.06, 0.11, 0.11, 0.22, 0.22, 0.56, 0.56, 1.10, 1.10) y1 <- c(76, 47, 97, 107, 123, 139, 159, 152, 191, 201, 207, 200) # Define the Michaelis-Menten (MM) model MM <- function(theta, x){ theta[1]*x / ( theta[2] + x ) } par1 <- c(212.68490865, 0.06412421) res3 <- biasIPEC(MM, theta=par1, x=x1, y=y1, tol= 1e-20) res3 ################################################################################################# #### Example 2 ################################################################################## # Development data of female pupae of cotton bollworm (Wu et al. 2009) # References: # Ratkowsky, D.A. and Reddy, G.V.P. (2017) Empirical model with excellent statistical # properties for describing temperature-dependent developmental rates of insects # and mites. Ann. Entomol. Soc. Am. 110, 302-309. # Wu, K., Gong, P. and Ruan, Y. (2009) Estimating developmental rates of # Helicoverpa armigera (Lepidoptera: Noctuidae) pupae at constant and # alternating temperature by nonlinear models. Acta Entomol. Sin. 52, 640-650. # 'x2' is the vector of temperature (in degrees Celsius) # 'D2' is the vector of developmental duration (in d) # 'y2' is the vector of the square root of developmental rate (in 1/d) x2 <- seq(15, 37, by=1) D2 <- c(41.24,37.16,32.47,26.22,22.71,19.01,16.79,15.63,14.27,12.48, 11.3,10.56,9.69,9.14,8.24,8.02,7.43,7.27,7.35,7.49,7.63,7.9,10.03) y2 <- 1/D2 y2 <- sqrt( y2 ) # Define the square root function of the Lobry-Rosso-Flandrois (LRF) model sqrt.LRF <- function(P, x){ ropt <- P[1] Topt <- P[2] Tmin <- P[3] Tmax <- P[4] fun0 <- function(z){ z[z < Tmin] <- Tmin z[z > Tmax] <- Tmax return(z) } x <- fun0(x) if (Tmin >= Tmax | ropt <= 0 | Topt <= Tmin | Topt >= Tmax) temp <- Inf if (Tmax > Tmin & ropt > 0 & Topt > Tmin & Topt < Tmax){ temp <- sqrt( ropt*(x-Tmax)*(x-Tmin)^2/((Topt-Tmin)*((Topt-Tmin )*(x-Topt)-(Topt-Tmax)*(Topt+Tmin-2*x))) ) } return( temp ) } myfun <- sqrt.LRF par2 <- c(0.1382926, 33.4575663, 5.5841244, 38.8282021) # To calculate bias resu3 <- biasIPEC(myfun, theta=par2, x=x2, y=y2, tol= 1e-20) resu3 ################################################################################################# #### Example 3 ################################################################################## # Weight of cut grass data (Pattinson 1981) # References: # Clarke, G.P.Y. (1987) Approximate confidence limits for a parameter function in nonlinear # regression. J. Am. Stat. Assoc. 82, 221-230. # Gebremariam, B. (2014) Is nonlinear regression throwing you a curve? # New diagnostic and inference tools in the NLIN Procedure. Paper SAS384-2014. # http://support.sas.com/resources/papers/proceedings14/SAS384-2014.pdf # Pattinson, N.B. (1981) Dry Matter Intake: An Estimate of the Animal # Response to Herbage on Offer. unpublished M.Sc. thesis, University # of Natal, Pietermaritzburg, South Africa, Department of Grassland Science. # 'x4' is the vector of weeks after commencement of grazing in a pasture # 'y4' is the vector of weight of cut grass from 10 randomly sited quadrants x4 <- 1:13 y4 <- c(3.183, 3.059, 2.871, 2.622, 2.541, 2.184, 2.110, 2.075, 2.018, 1.903, 1.770, 1.762, 1.550) # Define the first case of Mitscherlich equation MitA <- function(P1, x){ P1[3] + P1[2]*exp(P1[1]*x) } # Define the second case of Mitscherlich equation MitB <- function(P2, x){ log( P2[3] ) + exp(P2[2] + P2[1]*x) } # Define the third case of Mitscherlich equation MitC <- function(P3, x, x1=1, x2=13){ theta1 <- P3[1] beta2 <- P3[2] beta3 <- P3[3] theta2 <- (beta3 - beta2)/(exp(theta1*x2)-exp(theta1*x1)) theta3 <- beta2/(1-exp(theta1*(x1-x2))) - beta3/(exp(theta1*(x2-x1))-1) theta3 + theta2*exp(theta1*x) } ini.val3 <- c(-0.1, 2.5, 1) r0 <- fitIPEC( MitA, x=x4, y=y4, ini.val=ini.val3, xlim=NULL, ylim=NULL, fig.opt=TRUE, control=list(trace=FALSE, reltol=1e-20, maxit=50000) ) parA <- r0$par parA r3 <- biasIPEC( MitA, theta=parA, x=x4, y=y4, tol=1e-20 ) r3 ini.val4 <- c(exp(-0.1), log(2.5), 1) R0 <- fitIPEC( MitB, x=x4, y=y4, ini.val=ini.val3, xlim=NULL, ylim=NULL, fig.opt=TRUE, control=list(trace=FALSE, reltol=1e-20, maxit=50000) ) parB <- R0$par parB R3 <- biasIPEC( MitB, theta=parB, x=x4, y=y4, tol=1e-20 ) R3 ini.val6 <- c(-0.15, 2.52, 1.09) RES0 <- fitIPEC( MitC, x=x4, y=y4, ini.val=ini.val6, xlim=NULL, ylim=NULL, fig.opt=TRUE, control=list(trace=FALSE, reltol=1e-20, maxit=50000) ) parC <- RES0$par parC RES3 <- biasIPEC(MitC, theta=parC, x=x4, y=y4, tol=1e-20) RES3 ################################################################################################# #### Example 4 ################################################################################### # Data on biochemical oxygen demand (BOD; Marske 1967) # References # Pages 56, 255 and 271 in Bates and Watts (1988) # Carr, N.L. (1960) Kinetics of catalytic isomerization of n-pentane. Ind. Eng. Chem. # 52, 391-396. data(isom) Y <- isom[,1] X <- isom[,2:4] # There are three independent variables saved in matrix 'X' and one response variable (Y) # The first column of 'X' is the vector of partial pressure of hydrogen # The second column of 'X' is the vector of partial pressure of n-pentane # The third column of 'X' is the vector of partial pressure of isopentane # Y is the vector of experimental reaction rate (in 1/hr) isom.fun <- function(theta, x){ x1 <- x[,1] x2 <- x[,2] x3 <- x[,3] theta1 <- theta[1] theta2 <- theta[2] theta3 <- theta[3] theta4 <- theta[4] theta1*theta3*(x2-x3/1.632) / ( 1 + theta2*x1 + theta3*x2 + theta4*x3 ) } par8 <- c(35.92831619, 0.07084811, 0.03772270, 0.16718384) cons3 <- biasIPEC( isom.fun, theta=par8, x=X, y=Y, tol= 1e-20 ) cons3 #################################################################################################
#### Example 1 ################################################################################# # The velocity of the reaction (counts/min^2) under different substrate concentrations # in parts per million (ppm) (Page 269 of Bates and Watts 1988) x1 <- c(0.02, 0.02, 0.06, 0.06, 0.11, 0.11, 0.22, 0.22, 0.56, 0.56, 1.10, 1.10) y1 <- c(76, 47, 97, 107, 123, 139, 159, 152, 191, 201, 207, 200) # Define the Michaelis-Menten (MM) model MM <- function(theta, x){ theta[1]*x / ( theta[2] + x ) } par1 <- c(212.68490865, 0.06412421) res3 <- biasIPEC(MM, theta=par1, x=x1, y=y1, tol= 1e-20) res3 ################################################################################################# #### Example 2 ################################################################################## # Development data of female pupae of cotton bollworm (Wu et al. 2009) # References: # Ratkowsky, D.A. and Reddy, G.V.P. (2017) Empirical model with excellent statistical # properties for describing temperature-dependent developmental rates of insects # and mites. Ann. Entomol. Soc. Am. 110, 302-309. # Wu, K., Gong, P. and Ruan, Y. (2009) Estimating developmental rates of # Helicoverpa armigera (Lepidoptera: Noctuidae) pupae at constant and # alternating temperature by nonlinear models. Acta Entomol. Sin. 52, 640-650. # 'x2' is the vector of temperature (in degrees Celsius) # 'D2' is the vector of developmental duration (in d) # 'y2' is the vector of the square root of developmental rate (in 1/d) x2 <- seq(15, 37, by=1) D2 <- c(41.24,37.16,32.47,26.22,22.71,19.01,16.79,15.63,14.27,12.48, 11.3,10.56,9.69,9.14,8.24,8.02,7.43,7.27,7.35,7.49,7.63,7.9,10.03) y2 <- 1/D2 y2 <- sqrt( y2 ) # Define the square root function of the Lobry-Rosso-Flandrois (LRF) model sqrt.LRF <- function(P, x){ ropt <- P[1] Topt <- P[2] Tmin <- P[3] Tmax <- P[4] fun0 <- function(z){ z[z < Tmin] <- Tmin z[z > Tmax] <- Tmax return(z) } x <- fun0(x) if (Tmin >= Tmax | ropt <= 0 | Topt <= Tmin | Topt >= Tmax) temp <- Inf if (Tmax > Tmin & ropt > 0 & Topt > Tmin & Topt < Tmax){ temp <- sqrt( ropt*(x-Tmax)*(x-Tmin)^2/((Topt-Tmin)*((Topt-Tmin )*(x-Topt)-(Topt-Tmax)*(Topt+Tmin-2*x))) ) } return( temp ) } myfun <- sqrt.LRF par2 <- c(0.1382926, 33.4575663, 5.5841244, 38.8282021) # To calculate bias resu3 <- biasIPEC(myfun, theta=par2, x=x2, y=y2, tol= 1e-20) resu3 ################################################################################################# #### Example 3 ################################################################################## # Weight of cut grass data (Pattinson 1981) # References: # Clarke, G.P.Y. (1987) Approximate confidence limits for a parameter function in nonlinear # regression. J. Am. Stat. Assoc. 82, 221-230. # Gebremariam, B. (2014) Is nonlinear regression throwing you a curve? # New diagnostic and inference tools in the NLIN Procedure. Paper SAS384-2014. # http://support.sas.com/resources/papers/proceedings14/SAS384-2014.pdf # Pattinson, N.B. (1981) Dry Matter Intake: An Estimate of the Animal # Response to Herbage on Offer. unpublished M.Sc. thesis, University # of Natal, Pietermaritzburg, South Africa, Department of Grassland Science. # 'x4' is the vector of weeks after commencement of grazing in a pasture # 'y4' is the vector of weight of cut grass from 10 randomly sited quadrants x4 <- 1:13 y4 <- c(3.183, 3.059, 2.871, 2.622, 2.541, 2.184, 2.110, 2.075, 2.018, 1.903, 1.770, 1.762, 1.550) # Define the first case of Mitscherlich equation MitA <- function(P1, x){ P1[3] + P1[2]*exp(P1[1]*x) } # Define the second case of Mitscherlich equation MitB <- function(P2, x){ log( P2[3] ) + exp(P2[2] + P2[1]*x) } # Define the third case of Mitscherlich equation MitC <- function(P3, x, x1=1, x2=13){ theta1 <- P3[1] beta2 <- P3[2] beta3 <- P3[3] theta2 <- (beta3 - beta2)/(exp(theta1*x2)-exp(theta1*x1)) theta3 <- beta2/(1-exp(theta1*(x1-x2))) - beta3/(exp(theta1*(x2-x1))-1) theta3 + theta2*exp(theta1*x) } ini.val3 <- c(-0.1, 2.5, 1) r0 <- fitIPEC( MitA, x=x4, y=y4, ini.val=ini.val3, xlim=NULL, ylim=NULL, fig.opt=TRUE, control=list(trace=FALSE, reltol=1e-20, maxit=50000) ) parA <- r0$par parA r3 <- biasIPEC( MitA, theta=parA, x=x4, y=y4, tol=1e-20 ) r3 ini.val4 <- c(exp(-0.1), log(2.5), 1) R0 <- fitIPEC( MitB, x=x4, y=y4, ini.val=ini.val3, xlim=NULL, ylim=NULL, fig.opt=TRUE, control=list(trace=FALSE, reltol=1e-20, maxit=50000) ) parB <- R0$par parB R3 <- biasIPEC( MitB, theta=parB, x=x4, y=y4, tol=1e-20 ) R3 ini.val6 <- c(-0.15, 2.52, 1.09) RES0 <- fitIPEC( MitC, x=x4, y=y4, ini.val=ini.val6, xlim=NULL, ylim=NULL, fig.opt=TRUE, control=list(trace=FALSE, reltol=1e-20, maxit=50000) ) parC <- RES0$par parC RES3 <- biasIPEC(MitC, theta=parC, x=x4, y=y4, tol=1e-20) RES3 ################################################################################################# #### Example 4 ################################################################################### # Data on biochemical oxygen demand (BOD; Marske 1967) # References # Pages 56, 255 and 271 in Bates and Watts (1988) # Carr, N.L. (1960) Kinetics of catalytic isomerization of n-pentane. Ind. Eng. Chem. # 52, 391-396. data(isom) Y <- isom[,1] X <- isom[,2:4] # There are three independent variables saved in matrix 'X' and one response variable (Y) # The first column of 'X' is the vector of partial pressure of hydrogen # The second column of 'X' is the vector of partial pressure of n-pentane # The third column of 'X' is the vector of partial pressure of isopentane # Y is the vector of experimental reaction rate (in 1/hr) isom.fun <- function(theta, x){ x1 <- x[,1] x2 <- x[,2] x3 <- x[,3] theta1 <- theta[1] theta2 <- theta[2] theta3 <- theta[3] theta4 <- theta[4] theta1*theta3*(x2-x3/1.632) / ( 1 + theta2*x1 + theta3*x2 + theta4*x3 ) } par8 <- c(35.92831619, 0.07084811, 0.03772270, 0.16718384) cons3 <- biasIPEC( isom.fun, theta=par8, x=X, y=Y, tol= 1e-20 ) cons3 #################################################################################################
Calculates the BIC value(s) of the object(s) obtained from
using the fitIPEC
function.
bic( object, ... )
bic( object, ... )
object |
A fitted model object for which there exists the sample size ( |
... |
Optionally more fitted model objects |
BIC = p ln(n) - 2 ln(L), where p represents the number of model parameter(s) plus 1 for the error, n represents the sample size, and ln(L) represents the maximum log-likelihood of the estimated model (Spiess and Neumeyer, 2010).
There is a BIC value corresponding to one object, and there is a vector of BIC values corresponding to the multiple objects.
When there are sample.size
and n
in object
at the same time, the default of
the sample size is sample.size
, which is superior to n
.
The BIC gives a higher penalty on the number of model parameters than the AIC.
Peijian Shi [email protected], Peter M. Ridland [email protected], David A. Ratkowsky [email protected], Yang Li [email protected].
Spiess, A-N and Neumeyer, N. (2010) An evaluation of R squared as an inadequate measure for nonlinear models in pharmacological and biochemical research: a Monte Carlo approach. BMC Pharmacol. 10, 6. doi:10.1186/1471-2210-10-6
aic
, AIC
in package stats, and BIC
in package stats
#### Example ##################################################################################### data(leaves) attach(leaves) # Choose a geographical population (see Table S1 in Wang et al. [2018] for details) # Wang, P., Ratkowsky, D.A., Xiao, X., Yu, X., Su, J., Zhang, L. and Shi, P. # (2018) Taylor's power law for leaf bilateral symmetry. Forests 9, 500. doi: 10.3390/f9080500 # 1: AJ; 2: HN; 3: HW; 4: HZ; 5: JD; # 6: JS; 7: SC; 8: TC; 9: TT; 10: TX ind <- 1 L <- Length[PopuCode == ind] W <- Width[PopuCode == ind] A <- Area[PopuCode == ind] # Define a model y = a*(x1*x2), where a is a parameter to be estimated propor <- function(theta, x){ a <- theta[1] x1 <- x[,1] x2 <- x[,2] a*x1*x2 } # Define a model y = a*(x1^b)*(x2^c), where a, b and c are parameters to be estimated threepar <- function(theta, x){ a <- theta[1] b <- theta[2] c <- theta[3] x1 <- x[,1] x2 <- x[,2] a*x1^b*x2^c } # Define a model y = a*x^b, where a and b are parameters to be estimated twopar <- function(theta, x){ a <- theta[1] b <- theta[2] a*x^b } A1 <- fitIPEC(propor, x=cbind(L, W), y=A, fig.opt=FALSE, ini.val=list(seq(0.1, 1.5, by=0.1))) B1 <- curvIPEC(propor, theta=A1$par, x=cbind(L, W), y=A) A2 <- fitIPEC(threepar, x=cbind(L, W), y=A, fig.opt=FALSE, ini.val=list(A1$par, seq(0.5, 1.5, by=0.1), seq(0.5, 1.5, by=0.1))) B2 <- curvIPEC(threepar, theta=A2$par, x=cbind(L, W), y=A) A3 <- fitIPEC(twopar, x=L, y=A, fig.opt=FALSE, ini.val=list(1, seq(0.5, 1.5, by=0.05))) B3 <- curvIPEC(twopar, theta=A3$par, x=L, y=A) A4 <- fitIPEC(twopar, x=W, y=A, fig.opt=FALSE, ini.val=list(1, seq(0.5, 1.5, by=0.05))) B4 <- curvIPEC(twopar, theta=A4$par, x=W, y=A) aic(A1, A2, A3, A4) bic(A1, A2, A3, A4) ##################################################################################################
#### Example ##################################################################################### data(leaves) attach(leaves) # Choose a geographical population (see Table S1 in Wang et al. [2018] for details) # Wang, P., Ratkowsky, D.A., Xiao, X., Yu, X., Su, J., Zhang, L. and Shi, P. # (2018) Taylor's power law for leaf bilateral symmetry. Forests 9, 500. doi: 10.3390/f9080500 # 1: AJ; 2: HN; 3: HW; 4: HZ; 5: JD; # 6: JS; 7: SC; 8: TC; 9: TT; 10: TX ind <- 1 L <- Length[PopuCode == ind] W <- Width[PopuCode == ind] A <- Area[PopuCode == ind] # Define a model y = a*(x1*x2), where a is a parameter to be estimated propor <- function(theta, x){ a <- theta[1] x1 <- x[,1] x2 <- x[,2] a*x1*x2 } # Define a model y = a*(x1^b)*(x2^c), where a, b and c are parameters to be estimated threepar <- function(theta, x){ a <- theta[1] b <- theta[2] c <- theta[3] x1 <- x[,1] x2 <- x[,2] a*x1^b*x2^c } # Define a model y = a*x^b, where a and b are parameters to be estimated twopar <- function(theta, x){ a <- theta[1] b <- theta[2] a*x^b } A1 <- fitIPEC(propor, x=cbind(L, W), y=A, fig.opt=FALSE, ini.val=list(seq(0.1, 1.5, by=0.1))) B1 <- curvIPEC(propor, theta=A1$par, x=cbind(L, W), y=A) A2 <- fitIPEC(threepar, x=cbind(L, W), y=A, fig.opt=FALSE, ini.val=list(A1$par, seq(0.5, 1.5, by=0.1), seq(0.5, 1.5, by=0.1))) B2 <- curvIPEC(threepar, theta=A2$par, x=cbind(L, W), y=A) A3 <- fitIPEC(twopar, x=L, y=A, fig.opt=FALSE, ini.val=list(1, seq(0.5, 1.5, by=0.05))) B3 <- curvIPEC(twopar, theta=A3$par, x=L, y=A) A4 <- fitIPEC(twopar, x=W, y=A, fig.opt=FALSE, ini.val=list(1, seq(0.5, 1.5, by=0.05))) B4 <- curvIPEC(twopar, theta=A4$par, x=W, y=A) aic(A1, A2, A3, A4) bic(A1, A2, A3, A4) ##################################################################################################
Generates the density distributions, standard errors, confidence intervals, covariance matrices and correlation matrices of parameters based on bootstrap replications.
bootIPEC( expr, x, y, ini.val, weights = NULL, control = list(), nboot = 200, CI = 0.95, fig.opt = TRUE, fold = 3.5, unique.num = 2, prog.opt = TRUE )
bootIPEC( expr, x, y, ini.val, weights = NULL, control = list(), nboot = 200, CI = 0.95, fig.opt = TRUE, fold = 3.5, unique.num = 2, prog.opt = TRUE )
expr |
A given parametric model |
x |
A vector or matrix of observations of independent variable(s) |
y |
A vector of observations of response variable |
ini.val |
A vector or list of initial values of model parameters |
weights |
An optional vector of weights to be used in the fitting process.
|
control |
A list of control parameters for using the |
nboot |
The number of bootstrap replications |
CI |
The confidence level(s) of the required interval(s) |
fig.opt |
An option of drawing figures of the distributions of bootstrap values of parameters and figures of pairwise comparisons of bootstrap values |
fold |
A parameter removing the extreme bootstrap values of parameters |
unique.num |
The least number of sampled non-overlapping data points for carrying out a bootstrap nonlinear regression |
prog.opt |
An option of showing the running progress of bootstrap |
ini.val
can be a vector or a list that has saved initial values for model parameters,
e.g. y = beta0 + beta1 * x + beta2 * x^2
,
ini.val = list(beta0=seq(5, 15, len=2), beta1=seq(0.1, 1, len=9),
beta2=seq(0.01, 0.05, len=5))
, which is similar to the usage of the
input argument of start
of nls
in package stats.
In the weights
argument option, the default is weights = NULL
.
In that case, ordinary least squares is used.
The residual sum of squares (RSS) between the observed and predicted values
is minimized to estimate a model's parameters, i.e.,
where and
represent the observed and predicted
values, respectively;
and
represents the sample size. If
weights
is a numeric vector,
the weighted residual sum of squares is minimized, i.e.,
where is the
elements of
weights
.
CI
determines the width of confidence intervals.
fold
is used to delete the data whose differences from the median exceed
a certain fold
of the difference between 3/4 and 1/4 quantiles of the
bootstrap values of a model parameter.
The default of unique.num
is 2. That is, at least two non-overlapping data
points randomly sampled from are needed for carrying out
a bootstrap nonlinear regression.
M |
The matrix saving the fitted results of all |
perc.ci.mat |
The matrix saving the estimate, standard error, median, mean, and the calculated lower and upper limits of confidence interval based on the bootstrap percentile method |
bca.ci.mat |
The matrix saving the estimate, standard error, median, mean,
and the calculated lower and upper limits of confidence interval based on
the bootstrap |
covar.mat |
The covariance matrix of parameters based on the bootstrap
values when |
cor.mat |
The correlation matrix of parameters based on the bootstrap
values when |
To obtain reliable confidence intervals of model parameters, more than 2000
bootstrap replications are recommended; whereas to obtain a reliable standard error of the estimate
of a parameter, more than 30 bootstrap replications are sufficient (Efron and Tibshirani 1993).
bca.ci.mat
is recommended to show better confidence intervals of parameters than
those in perc.ci.mat
.
The outputs of model parameters will all be represented by ,
from 1
to
, where
represents the number of model parameters. The letters of model
parameters defined by users such as
will be automatically replaced by
.
Peijian Shi [email protected], Peter M. Ridland [email protected], David A. Ratkowsky [email protected], Yang Li [email protected].
Efron, B. and Tibshirani, R.J. (1993) An Introduction to the Bootstrap. Chapman and Hall (CRC), New York. doi:10.2307/2532810
Sandhu, H.S., Shi, P., Kuang, X., Xue, F. and Ge, F. (2011) Applications of the bootstrap to
insect physiology. Fla. Entomol. 94, 10361041. doi:10.1653/024.094.0442
#### Example 1 ################################################################################# graphics.off() # The velocity of the reaction (counts/min^2) under different substrate concentrations # in parts per million (ppm) (Page 269 of Bates and Watts 1988) x1 <- c(0.02, 0.02, 0.06, 0.06, 0.11, 0.11, 0.22, 0.22, 0.56, 0.56, 1.10, 1.10) y1 <- c(76, 47, 97, 107, 123, 139, 159, 152, 191, 201, 207, 200) # Define the Michaelis-Menten (MM) model MM <- function(theta, x){ theta[1]*x / ( theta[2] + x ) } set.seed(123) res4 <- bootIPEC( MM, x=x1, y=y1, ini.val=c(200, 0.05), control=list(reltol=1e-20, maxit=40000), nboot=2000, CI=0.95, fig.opt=TRUE ) res4 set.seed(NULL) ################################################################################################# #### Example 2 ################################################################################## graphics.off() # Development data of female pupae of cotton bollworm (Wu et al. 2009) # References: # Ratkowsky, D.A. and Reddy, G.V.P. (2017) Empirical model with excellent statistical # properties for describing temperature-dependent developmental rates of insects # and mites. Ann. Entomol. Soc. Am. 110, 302-309. # Wu, K., Gong, P. and Ruan, Y. (2009) Estimating developmental rates of # Helicoverpa armigera (Lepidoptera: Noctuidae) pupae at constant and # alternating temperature by nonlinear models. Acta Entomol. Sin. 52, 640-650. # 'x2' is the vector of temperature (in degrees Celsius) # 'D2' is the vector of developmental duration (in d) # 'y2' is the vector of the square root of developmental rate (in 1/d) x2 <- seq(15, 37, by=1) D2 <- c(41.24,37.16,32.47,26.22,22.71,19.01,16.79,15.63,14.27,12.48, 11.3,10.56,9.69,9.14,8.24,8.02,7.43,7.27,7.35,7.49,7.63,7.9,10.03) y2 <- 1/D2 y2 <- sqrt( y2 ) ini.val1 <- c(0.14, 30, 10, 40) # Define the square root function of the Lobry-Rosso-Flandrois (LRF) model sqrt.LRF <- function(P, x){ ropt <- P[1] Topt <- P[2] Tmin <- P[3] Tmax <- P[4] fun0 <- function(z){ z[z < Tmin] <- Tmin z[z > Tmax] <- Tmax return(z) } x <- fun0(x) if (Tmin >= Tmax | ropt <= 0 | Topt <= Tmin | Topt >= Tmax) temp <- Inf if (Tmax > Tmin & ropt > 0 & Topt > Tmin & Topt < Tmax){ temp <- sqrt( ropt*(x-Tmax)*(x-Tmin)^2/((Topt-Tmin)*((Topt-Tmin )*(x-Topt)-(Topt-Tmax)*(Topt+Tmin-2*x))) ) } return( temp ) } myfun <- sqrt.LRF set.seed(123) resu4 <- bootIPEC( myfun, x=x2, y=y2, ini.val=ini.val1, nboot=2000, CI=0.95, fig.opt=TRUE ) resu4 set.seed(NULL) ################################################################################################# #### Example 3 ################################################################################## graphics.off() # Height growth data of four species of bamboo (Gramineae: Bambusoideae) # Reference(s): # Shi, P., Fan, M., Ratkowsky, D.A., Huang, J., Wu, H., Chen, L., Fang, S. and # Zhang, C. (2017) Comparison of two ontogenetic growth equations for animals and plants. # Ecol. Model. 349, 1-10. data(shoots) # Choose a species # 1: Phyllostachys iridescens; 2: Phyllostachys mannii; # 3: Pleioblastus maculatus; 4: Sinobambusa tootsik. # 'x3' is the vector of the observation times from a specific starting time of growth # 'y3' is the vector of the aboveground height values of bamboo shoots at 'x3' ind <- 4 x3 <- shoots$x[shoots$Code == ind] y3 <- shoots$y[shoots$Code == ind] # Define the beta sigmoid model (bsm) bsm <- function(P, x){ P <- cbind(P) if(length(P) !=4 ) {stop(" The number of parameters should be 4!")} ropt <- P[1] topt <- P[2] tmin <- P[3] tmax <- P[4] tailor.fun <- function(x){ x[x < tmin] <- tmin x[x > tmax] <- tmax return(x) } x <- tailor.fun(x) return(ropt*(x-tmin)*(x-2*tmax+topt)/(topt+tmin- 2*tmax)*( (x-tmin)/(topt-tmin) )^((topt-tmin)/(tmax-topt))) } # Define the simplified beta sigmoid model (simp.bsm) simp.bsm <- function(P, x, tmin=0){ P <- cbind(P) ropt <- P[1] topt <- P[2] tmax <- P[3] tailor.fun <- function(x){ x[x < tmin] <- tmin x[x > tmax] <- tmax return(x) } x <- tailor.fun(x) return(ropt*(x-tmin)*(x-2*tmax+topt)/(topt+tmin- 2*tmax)*((x-tmin)/(topt-tmin) )^((topt-tmin)/(tmax-topt))) } # For the original beta sigmoid model ini.val2 <- c(40, 30, 5, 50) xlab2 <- "Time (d)" ylab2 <- "Height (cm)" set.seed(123) re4 <- bootIPEC( bsm, x=x3, y=y3, ini.val=ini.val2, control=list(trace=FALSE, reltol=1e-20, maxit=50000), nboot=2000, CI=0.95, fig.opt=TRUE, fold=10 ) re4 set.seed(NULL) # For the simplified beta sigmoid model (in comparison with the original beta sigmoid model) ini.val7 <- c(40, 30, 50) set.seed(123) RESU4 <- bootIPEC( simp.bsm, x=x3, y=y3, ini.val=ini.val7, control=list(trace=FALSE, reltol=1e-20, maxit=50000), nboot=2000, CI=0.95, fig.opt=TRUE, fold=10 ) RESU4 set.seed(NULL) ################################################################################################# #### Example 4 ################################################################################## graphics.off() # Weight of cut grass data (Pattinson 1981) # References: # Clarke, G.P.Y. (1987) Approximate confidence limits for a parameter function in nonlinear # regression. J. Am. Stat. Assoc. 82, 221-230. # Gebremariam, B. (2014) Is nonlinear regression throwing you a curve? # New diagnostic and inference tools in the NLIN Procedure. Paper SAS384-2014. # http://support.sas.com/resources/papers/proceedings14/SAS384-2014.pdf # Pattinson, N.B. (1981) Dry Matter Intake: An Estimate of the Animal # Response to Herbage on Offer. unpublished M.Sc. thesis, University # of Natal, Pietermaritzburg, South Africa, Department of Grassland Science. # 'x4' is the vector of weeks after commencement of grazing in a pasture # 'y4' is the vector of weight of cut grass from 10 randomly sited quadrants x4 <- 1:13 y4 <- c( 3.183, 3.059, 2.871, 2.622, 2.541, 2.184, 2.110, 2.075, 2.018, 1.903, 1.770, 1.762, 1.550 ) # Define the first case of Mitscherlich equation MitA <- function(P1, x){ P1[3] + P1[2]*exp(P1[1]*x) } # Define the second case of Mitscherlich equation MitB <- function(P2, x){ log( P2[3] ) + exp(P2[2] + P2[1]*x) } # Define the third case of Mitscherlich equation MitC <- function(P3, x, x1=1, x2=13){ theta1 <- P3[1] beta2 <- P3[2] beta3 <- P3[3] theta2 <- (beta3 - beta2)/(exp(theta1*x2)-exp(theta1*x1)) theta3 <- beta2/(1-exp(theta1*(x1-x2))) - beta3/(exp(theta1*(x2-x1))-1) theta3 + theta2*exp(theta1*x) } set.seed(123) ini.val3 <- c(-0.1, 2.5, 1.0) r4 <- bootIPEC( MitA, x=x4, y=y4, ini.val=ini.val3, nboot=2000, CI=0.95, fig.opt=TRUE ) r4 ini.val4 <- c(exp(-0.1), log(2.5), 1) R4 <- bootIPEC( MitB, x=x4, y=y4, ini.val=ini.val4, nboot=2000, CI=0.95, fig.opt=TRUE ) R4 # ini.val6 <- c(-0.15, 2.52, 1.09) iv.list2 <- list(seq(-2, -0.05, len=5), seq(1, 4, len=8), seq(0.05, 3, by=0.5)) RES0 <- fitIPEC( MitC, x=x4, y=y4, ini.val=iv.list2, control=list(trace=FALSE, reltol=1e-10, maxit=5000) ) RES0$par RES4 <- bootIPEC( MitC, x=x4, y=y4, ini.val=iv.list2, control=list(trace=FALSE, reltol=1e-10, maxit=5000), nboot=5000, CI=0.95, fig.opt=TRUE, fold=3.5, unique.num=2 ) RES4 set.seed(NULL) #################################################################################################
#### Example 1 ################################################################################# graphics.off() # The velocity of the reaction (counts/min^2) under different substrate concentrations # in parts per million (ppm) (Page 269 of Bates and Watts 1988) x1 <- c(0.02, 0.02, 0.06, 0.06, 0.11, 0.11, 0.22, 0.22, 0.56, 0.56, 1.10, 1.10) y1 <- c(76, 47, 97, 107, 123, 139, 159, 152, 191, 201, 207, 200) # Define the Michaelis-Menten (MM) model MM <- function(theta, x){ theta[1]*x / ( theta[2] + x ) } set.seed(123) res4 <- bootIPEC( MM, x=x1, y=y1, ini.val=c(200, 0.05), control=list(reltol=1e-20, maxit=40000), nboot=2000, CI=0.95, fig.opt=TRUE ) res4 set.seed(NULL) ################################################################################################# #### Example 2 ################################################################################## graphics.off() # Development data of female pupae of cotton bollworm (Wu et al. 2009) # References: # Ratkowsky, D.A. and Reddy, G.V.P. (2017) Empirical model with excellent statistical # properties for describing temperature-dependent developmental rates of insects # and mites. Ann. Entomol. Soc. Am. 110, 302-309. # Wu, K., Gong, P. and Ruan, Y. (2009) Estimating developmental rates of # Helicoverpa armigera (Lepidoptera: Noctuidae) pupae at constant and # alternating temperature by nonlinear models. Acta Entomol. Sin. 52, 640-650. # 'x2' is the vector of temperature (in degrees Celsius) # 'D2' is the vector of developmental duration (in d) # 'y2' is the vector of the square root of developmental rate (in 1/d) x2 <- seq(15, 37, by=1) D2 <- c(41.24,37.16,32.47,26.22,22.71,19.01,16.79,15.63,14.27,12.48, 11.3,10.56,9.69,9.14,8.24,8.02,7.43,7.27,7.35,7.49,7.63,7.9,10.03) y2 <- 1/D2 y2 <- sqrt( y2 ) ini.val1 <- c(0.14, 30, 10, 40) # Define the square root function of the Lobry-Rosso-Flandrois (LRF) model sqrt.LRF <- function(P, x){ ropt <- P[1] Topt <- P[2] Tmin <- P[3] Tmax <- P[4] fun0 <- function(z){ z[z < Tmin] <- Tmin z[z > Tmax] <- Tmax return(z) } x <- fun0(x) if (Tmin >= Tmax | ropt <= 0 | Topt <= Tmin | Topt >= Tmax) temp <- Inf if (Tmax > Tmin & ropt > 0 & Topt > Tmin & Topt < Tmax){ temp <- sqrt( ropt*(x-Tmax)*(x-Tmin)^2/((Topt-Tmin)*((Topt-Tmin )*(x-Topt)-(Topt-Tmax)*(Topt+Tmin-2*x))) ) } return( temp ) } myfun <- sqrt.LRF set.seed(123) resu4 <- bootIPEC( myfun, x=x2, y=y2, ini.val=ini.val1, nboot=2000, CI=0.95, fig.opt=TRUE ) resu4 set.seed(NULL) ################################################################################################# #### Example 3 ################################################################################## graphics.off() # Height growth data of four species of bamboo (Gramineae: Bambusoideae) # Reference(s): # Shi, P., Fan, M., Ratkowsky, D.A., Huang, J., Wu, H., Chen, L., Fang, S. and # Zhang, C. (2017) Comparison of two ontogenetic growth equations for animals and plants. # Ecol. Model. 349, 1-10. data(shoots) # Choose a species # 1: Phyllostachys iridescens; 2: Phyllostachys mannii; # 3: Pleioblastus maculatus; 4: Sinobambusa tootsik. # 'x3' is the vector of the observation times from a specific starting time of growth # 'y3' is the vector of the aboveground height values of bamboo shoots at 'x3' ind <- 4 x3 <- shoots$x[shoots$Code == ind] y3 <- shoots$y[shoots$Code == ind] # Define the beta sigmoid model (bsm) bsm <- function(P, x){ P <- cbind(P) if(length(P) !=4 ) {stop(" The number of parameters should be 4!")} ropt <- P[1] topt <- P[2] tmin <- P[3] tmax <- P[4] tailor.fun <- function(x){ x[x < tmin] <- tmin x[x > tmax] <- tmax return(x) } x <- tailor.fun(x) return(ropt*(x-tmin)*(x-2*tmax+topt)/(topt+tmin- 2*tmax)*( (x-tmin)/(topt-tmin) )^((topt-tmin)/(tmax-topt))) } # Define the simplified beta sigmoid model (simp.bsm) simp.bsm <- function(P, x, tmin=0){ P <- cbind(P) ropt <- P[1] topt <- P[2] tmax <- P[3] tailor.fun <- function(x){ x[x < tmin] <- tmin x[x > tmax] <- tmax return(x) } x <- tailor.fun(x) return(ropt*(x-tmin)*(x-2*tmax+topt)/(topt+tmin- 2*tmax)*((x-tmin)/(topt-tmin) )^((topt-tmin)/(tmax-topt))) } # For the original beta sigmoid model ini.val2 <- c(40, 30, 5, 50) xlab2 <- "Time (d)" ylab2 <- "Height (cm)" set.seed(123) re4 <- bootIPEC( bsm, x=x3, y=y3, ini.val=ini.val2, control=list(trace=FALSE, reltol=1e-20, maxit=50000), nboot=2000, CI=0.95, fig.opt=TRUE, fold=10 ) re4 set.seed(NULL) # For the simplified beta sigmoid model (in comparison with the original beta sigmoid model) ini.val7 <- c(40, 30, 50) set.seed(123) RESU4 <- bootIPEC( simp.bsm, x=x3, y=y3, ini.val=ini.val7, control=list(trace=FALSE, reltol=1e-20, maxit=50000), nboot=2000, CI=0.95, fig.opt=TRUE, fold=10 ) RESU4 set.seed(NULL) ################################################################################################# #### Example 4 ################################################################################## graphics.off() # Weight of cut grass data (Pattinson 1981) # References: # Clarke, G.P.Y. (1987) Approximate confidence limits for a parameter function in nonlinear # regression. J. Am. Stat. Assoc. 82, 221-230. # Gebremariam, B. (2014) Is nonlinear regression throwing you a curve? # New diagnostic and inference tools in the NLIN Procedure. Paper SAS384-2014. # http://support.sas.com/resources/papers/proceedings14/SAS384-2014.pdf # Pattinson, N.B. (1981) Dry Matter Intake: An Estimate of the Animal # Response to Herbage on Offer. unpublished M.Sc. thesis, University # of Natal, Pietermaritzburg, South Africa, Department of Grassland Science. # 'x4' is the vector of weeks after commencement of grazing in a pasture # 'y4' is the vector of weight of cut grass from 10 randomly sited quadrants x4 <- 1:13 y4 <- c( 3.183, 3.059, 2.871, 2.622, 2.541, 2.184, 2.110, 2.075, 2.018, 1.903, 1.770, 1.762, 1.550 ) # Define the first case of Mitscherlich equation MitA <- function(P1, x){ P1[3] + P1[2]*exp(P1[1]*x) } # Define the second case of Mitscherlich equation MitB <- function(P2, x){ log( P2[3] ) + exp(P2[2] + P2[1]*x) } # Define the third case of Mitscherlich equation MitC <- function(P3, x, x1=1, x2=13){ theta1 <- P3[1] beta2 <- P3[2] beta3 <- P3[3] theta2 <- (beta3 - beta2)/(exp(theta1*x2)-exp(theta1*x1)) theta3 <- beta2/(1-exp(theta1*(x1-x2))) - beta3/(exp(theta1*(x2-x1))-1) theta3 + theta2*exp(theta1*x) } set.seed(123) ini.val3 <- c(-0.1, 2.5, 1.0) r4 <- bootIPEC( MitA, x=x4, y=y4, ini.val=ini.val3, nboot=2000, CI=0.95, fig.opt=TRUE ) r4 ini.val4 <- c(exp(-0.1), log(2.5), 1) R4 <- bootIPEC( MitB, x=x4, y=y4, ini.val=ini.val4, nboot=2000, CI=0.95, fig.opt=TRUE ) R4 # ini.val6 <- c(-0.15, 2.52, 1.09) iv.list2 <- list(seq(-2, -0.05, len=5), seq(1, 4, len=8), seq(0.05, 3, by=0.5)) RES0 <- fitIPEC( MitC, x=x4, y=y4, ini.val=iv.list2, control=list(trace=FALSE, reltol=1e-10, maxit=5000) ) RES0$par RES4 <- bootIPEC( MitC, x=x4, y=y4, ini.val=iv.list2, control=list(trace=FALSE, reltol=1e-10, maxit=5000), nboot=5000, CI=0.95, fig.opt=TRUE, fold=3.5, unique.num=2 ) RES4 set.seed(NULL) #################################################################################################
Calculates the Wald confidence curves and the likelihood confidence curves of model parameters.
confcurves( expr, x, y, ini.val, weights = NULL, control=list(), fig.opt = TRUE, fold = 5, np = 20, alpha = seq(1, 0.001, by=-0.001), show.CI = NULL, method = "Richardson", method.args = list(eps = 1e-04, d = 0.11, zero.tol = sqrt(.Machine$double.eps/7e-07), r = 6, v = 2, show.details = FALSE), side = NULL )
confcurves( expr, x, y, ini.val, weights = NULL, control=list(), fig.opt = TRUE, fold = 5, np = 20, alpha = seq(1, 0.001, by=-0.001), show.CI = NULL, method = "Richardson", method.args = list(eps = 1e-04, d = 0.11, zero.tol = sqrt(.Machine$double.eps/7e-07), r = 6, v = 2, show.details = FALSE), side = NULL )
expr |
A given parametric model |
x |
A vector or matrix of observations of independent variable(s) |
y |
A vector of observations of response variable |
ini.val |
A vector or list of initial values of model parameters |
weights |
An optional vector of weights to be used in the fitting process.
|
control |
A list of control parameters for using
the |
fig.opt |
An option to determine whether to draw the confidence curves of each parameter |
fold |
The fold of |
np |
The number of data points for forming the lower or upper bounds of a likelihood confidence interval of |
alpha |
The significance level(s) for calculating the |
show.CI |
The |
method |
It is the same as the input argument of |
method.args |
It is the same as the input argument of |
side |
It is the same as the input argument of |
For the Wald confidence curves, the corresponding
and
coordinates are:
and
where denotes the number of the observations,
denotes the number of model parameters, and
denotes the standard error of the
th model parameter's estimate.
For the likelihood confidence curves (Cook and Weisberg, 1990), the corresponding
and
coordinates are:
where represents the residual sum of squares for fitting the model with all model parameters;
represents the residual sum of squares for fitting the model with the
th model parameter
being fixed to be
. Here,
denotes the
th iteration, and
denotes the step size,
which equals
Here, fold
and np
are defined by the user in the arguments.
For other arguments, please see the
fitIPEC
and parinfo
functions for details.
partab |
The estimates, standard errors and confidence intervals of model parameters; also see the |
parlist |
A list for the estimate, Wald interval curves and likelihood interval curves of each model parameter. |
In the value of parlist
, there are the estimate (pari
), the Wald interval curves
(WaldCI
), and the likelihood interval curves (lhCI
) of the th model parameter.
In
WaldCI
, there are three columns. The first column, tc
,
represents , the second and third columns,
LCI
and UCI
,
represent the lower and upper bounds of the Wald confidence intervals, respectively.
In
lhCI
, there are six columns. The first and second columns, x.lower
and lhLCI
,
represent the lower bounds of the likelihood confidence intervals the and corresponding values,
respectively; the third and fourth columns,
x.upper
and lhUCI
, represent the upper
bounds of the likelihood confidence intervals and the corresponding values, respectively;
the fifth and sixth columns,
RSS.lower
and RSS.upper
, represent
the values of the residual sum of squares of the lower bounds
and those of the upper bounds, respectively. Please see Cook and Weisberg (1990) for details.
Peijian Shi [email protected], Peter M. Ridland [email protected], David A. Ratkowsky [email protected], Yang Li [email protected].
Cook, R.D. and Weisberg, S. (1990) Confidence curves in nonlinear regression.
J. Am. Statist. Assoc. 82, 221230. doi:10.1080/01621459.1990.10476233
Nelder, J.A. and Mead, R. (1965) A simplex method for function minimization.
Comput. J. 7, 308313. doi:10.1093/comjnl/7.4.308
Ratkowsky, D.A. (1990) Handbook of Nonlinear Regression Models, Marcel Dekker, New York.
parinfo
, fitIPEC
, optim
in package stats
#### Example 1 ################################################################################### # Weight of cut grass data (Pattinson 1981) # References: # Clarke, G.P.Y. (1987) Approximate confidence limits for a parameter function in nonlinear # regression. J. Am. Stat. Assoc. 82, 221-230. # Gebremariam, B. (2014) Is nonlinear regression throwing you a curve? # New diagnostic and inference tools in the NLIN Procedure. Paper SAS384-2014. # http://support.sas.com/resources/papers/proceedings14/SAS384-2014.pdf # Pattinson, N.B. (1981) Dry Matter Intake: An Estimate of the Animal # Response to Herbage on Offer. unpublished M.Sc. thesis, University # of Natal, Pietermaritzburg, South Africa, Department of Grassland Science. # 'x4' is the vector of weeks after commencement of grazing in a pasture # 'y4' is the vector of weight of cut grass from 10 randomly sited quadrants x4 <- 1:13 y4 <- c(3.183, 3.059, 2.871, 2.622, 2.541, 2.184, 2.110, 2.075, 2.018, 1.903, 1.770, 1.762, 1.550) # Define the first case of Mitscherlich equation MitA <- function(P, x){ P[3] + P[2]*exp(P[1]*x) } # Define the second case of Mitscherlich equation MitB <- function(P2, x){ if(P2[3] <= 0) temp <- mean(y4) if(P2[3] > 0) temp <- log(P2[3]) + exp(P2[2] + P2[1]*x) return( temp ) } # Define the third case of Mitscherlich equation MitC <- function(P3, x, x1=1, x2=13){ theta1 <- P3[1] beta2 <- P3[2] beta3 <- P3[3] theta2 <- (beta3 - beta2)/(exp(theta1*x2)-exp(theta1*x1)) theta3 <- beta2/(1-exp(theta1*(x1-x2))) - beta3/(exp(theta1*(x2-x1))-1) theta3 + theta2*exp(theta1*x) } ini.val3 <- c(-0.1, 2.5, 1) RESU1 <- confcurves( MitA, x=x4, y=y4, ini.val=ini.val3, fig.opt = TRUE, fold=5, np=20, alpha=seq(1, 0.001, by=-0.001), show.CI=c(0.8, 0.9, 0.95, 0.99) ) ini.val4 <- c(-0.10, 0.90, 2.5) RESU2 <- confcurves( MitB, x=x4, y=y4, ini.val=ini.val4, fig.opt = TRUE, fold=5, np=200, alpha=seq(1, 0.001, by=-0.001), show.CI=c(0.8, 0.9, 0.95, 0.99) ) ini.val6 <- c(-0.15, 2.5, 1) RESU3 <- confcurves( MitC, x=x4, y=y4, ini.val=ini.val6, fig.opt = TRUE, fold=5, np=20, alpha=seq(1, 0.001, by=-0.001), show.CI=c(0.8, 0.9, 0.95, 0.99) ) ################################################################################################## graphics.off()
#### Example 1 ################################################################################### # Weight of cut grass data (Pattinson 1981) # References: # Clarke, G.P.Y. (1987) Approximate confidence limits for a parameter function in nonlinear # regression. J. Am. Stat. Assoc. 82, 221-230. # Gebremariam, B. (2014) Is nonlinear regression throwing you a curve? # New diagnostic and inference tools in the NLIN Procedure. Paper SAS384-2014. # http://support.sas.com/resources/papers/proceedings14/SAS384-2014.pdf # Pattinson, N.B. (1981) Dry Matter Intake: An Estimate of the Animal # Response to Herbage on Offer. unpublished M.Sc. thesis, University # of Natal, Pietermaritzburg, South Africa, Department of Grassland Science. # 'x4' is the vector of weeks after commencement of grazing in a pasture # 'y4' is the vector of weight of cut grass from 10 randomly sited quadrants x4 <- 1:13 y4 <- c(3.183, 3.059, 2.871, 2.622, 2.541, 2.184, 2.110, 2.075, 2.018, 1.903, 1.770, 1.762, 1.550) # Define the first case of Mitscherlich equation MitA <- function(P, x){ P[3] + P[2]*exp(P[1]*x) } # Define the second case of Mitscherlich equation MitB <- function(P2, x){ if(P2[3] <= 0) temp <- mean(y4) if(P2[3] > 0) temp <- log(P2[3]) + exp(P2[2] + P2[1]*x) return( temp ) } # Define the third case of Mitscherlich equation MitC <- function(P3, x, x1=1, x2=13){ theta1 <- P3[1] beta2 <- P3[2] beta3 <- P3[3] theta2 <- (beta3 - beta2)/(exp(theta1*x2)-exp(theta1*x1)) theta3 <- beta2/(1-exp(theta1*(x1-x2))) - beta3/(exp(theta1*(x2-x1))-1) theta3 + theta2*exp(theta1*x) } ini.val3 <- c(-0.1, 2.5, 1) RESU1 <- confcurves( MitA, x=x4, y=y4, ini.val=ini.val3, fig.opt = TRUE, fold=5, np=20, alpha=seq(1, 0.001, by=-0.001), show.CI=c(0.8, 0.9, 0.95, 0.99) ) ini.val4 <- c(-0.10, 0.90, 2.5) RESU2 <- confcurves( MitB, x=x4, y=y4, ini.val=ini.val4, fig.opt = TRUE, fold=5, np=200, alpha=seq(1, 0.001, by=-0.001), show.CI=c(0.8, 0.9, 0.95, 0.99) ) ini.val6 <- c(-0.15, 2.5, 1) RESU3 <- confcurves( MitC, x=x4, y=y4, ini.val=ini.val6, fig.opt = TRUE, fold=5, np=20, alpha=seq(1, 0.001, by=-0.001), show.CI=c(0.8, 0.9, 0.95, 0.99) ) ################################################################################################## graphics.off()
The whole-plant biomass data of 12 species of crops growing in northern China in 2011.
data(crops)
data(crops)
In the data set, there are six columns: Code
, CommonName
, Date
,
Time
, FM
, and DM
.
Code
is used to save the codes of crops;
CommonName
is used to save the common names of crops;
Date
is used to save the investigation date;
Time
is used to save the ages of crops from the sowing date (27 June, 2011) in days;
FM
is used to save the whole-plant fresh mass of crops in g;
DM
is used to save the whole-plant dry mass of crops in g.
Code = 1
represents sunflowers;
Code = 2
represents peanuts;
Code = 3
represents black soybeans;
Code = 4
represents soybeans;
Code = 5
represents kidney beans;
Code = 6
represents garden peas;
Code = 7
represents adzuki beans;
Code = 8
represents mungbeans;
Code = 9
represents cottons;
Code = 10
represents sweet sorghums;
Code = 11
represents corns;
Code = 12
represents Mexican corns.
Shi, P., Fan, M., Ratkowsky, D.A., Huang, J., Wu, H., Chen, L., Fang, S. and
Zhang, C. (2017) Comparison of two ontogenetic growth equations for animals and plants.
Ecol. Model. 349, 110. doi:10.1016/j.ecolmodel.2017.01.012
Shi, P., Men, X., Sandhu, H.S., Chakraborty, A., Li, B., Ouyang, F., Sun, Y., Ge, F.
(2013) The "general" ontogenetic growth model is inapplicable to crop growth.
Ecol. Model. 266, 19. doi:10.1016/j.ecolmodel.2013.06.025
data(crops) ind <- 6 xv <- crops$Time[crops$Code == ind] yv <- crops$DM[crops$Code == ind] xlab0 <- "Time (d)" ylab0 <- "Dry mass (g)" dev.new() plot(xv, yv, cex=1.5, cex.lab=1.5, cex.axis=1.5, xlab=xlab0, ylab=ylab0) # Define the beta sigmoid model (bsm) bsm <- function(P, x){ P <- cbind(P) if(length(P) !=4 ) {stop("The number of parameters should be 4!")} ropt <- P[1] topt <- P[2] tmin <- P[3] tmax <- P[4] tailor.fun <- function(x){ x[x < tmin] <- tmin x[x > tmax] <- tmax return(x) } x <- tailor.fun(x) ropt*(x-tmin)*(x-2*tmax+topt)/(topt+tmin-2*tmax)*( (x-tmin)/(topt-tmin) )^((topt-tmin)/(tmax-topt)) } # For the original beta sigmoid model ini.val0 <- c(60, 30, seq(0, 10, 20), 100) fit1 <- fitIPEC( bsm, x=xv, y=yv, ini.val=ini.val0, xlim=NULL, ylim=NULL, xlab=xlab0, ylab=ylab0, fig.opt=TRUE, control=list(trace=FALSE, reltol=1e-20, maxit=50000) ) fit1$par w <- rep(1/as.numeric(tapply(yv, xv, var)), tapply(yv, xv, length)) fit2 <- fitIPEC( bsm, x=xv, y=yv, ini.val=ini.val0, weights=w, xlim=NULL, ylim=NULL, xlab=xlab0, ylab=ylab0, fig.opt=TRUE, control=list(trace=FALSE, reltol=1e-20, maxit=50000) ) fit2$par dev.new() xp <- seq(0, 120, len=2000) yp <- bsm(P=fit2$par, x=xp) xv2 <- as.numeric(tapply(xv, xv, mean)) yv2 <- as.numeric(tapply(yv, xv, mean)) sd2 <- as.numeric(tapply(yv, xv, sd)) Up <- yv2+sd2 Low <- yv2-sd2 plot( xv2, yv2, xlab=xlab0, ylab=ylab0, cex.lab=1.5, cex.axis=1.5, xlim=c(0,120), ylim=c(-5, 100), type="n" ) lines( xp, yp, col=4 ) points( xv2, yv2, pch=1, cex=1.5, col=2 ) for(i in 1:length(Up)){ lines(c(xv2[i], xv2[i]), c(Low[i], Up[i]), col=6) }
data(crops) ind <- 6 xv <- crops$Time[crops$Code == ind] yv <- crops$DM[crops$Code == ind] xlab0 <- "Time (d)" ylab0 <- "Dry mass (g)" dev.new() plot(xv, yv, cex=1.5, cex.lab=1.5, cex.axis=1.5, xlab=xlab0, ylab=ylab0) # Define the beta sigmoid model (bsm) bsm <- function(P, x){ P <- cbind(P) if(length(P) !=4 ) {stop("The number of parameters should be 4!")} ropt <- P[1] topt <- P[2] tmin <- P[3] tmax <- P[4] tailor.fun <- function(x){ x[x < tmin] <- tmin x[x > tmax] <- tmax return(x) } x <- tailor.fun(x) ropt*(x-tmin)*(x-2*tmax+topt)/(topt+tmin-2*tmax)*( (x-tmin)/(topt-tmin) )^((topt-tmin)/(tmax-topt)) } # For the original beta sigmoid model ini.val0 <- c(60, 30, seq(0, 10, 20), 100) fit1 <- fitIPEC( bsm, x=xv, y=yv, ini.val=ini.val0, xlim=NULL, ylim=NULL, xlab=xlab0, ylab=ylab0, fig.opt=TRUE, control=list(trace=FALSE, reltol=1e-20, maxit=50000) ) fit1$par w <- rep(1/as.numeric(tapply(yv, xv, var)), tapply(yv, xv, length)) fit2 <- fitIPEC( bsm, x=xv, y=yv, ini.val=ini.val0, weights=w, xlim=NULL, ylim=NULL, xlab=xlab0, ylab=ylab0, fig.opt=TRUE, control=list(trace=FALSE, reltol=1e-20, maxit=50000) ) fit2$par dev.new() xp <- seq(0, 120, len=2000) yp <- bsm(P=fit2$par, x=xp) xv2 <- as.numeric(tapply(xv, xv, mean)) yv2 <- as.numeric(tapply(yv, xv, mean)) sd2 <- as.numeric(tapply(yv, xv, sd)) Up <- yv2+sd2 Low <- yv2-sd2 plot( xv2, yv2, xlab=xlab0, ylab=ylab0, cex.lab=1.5, cex.axis=1.5, xlim=c(0,120), ylim=c(-5, 100), type="n" ) lines( xp, yp, col=4 ) points( xv2, yv2, pch=1, cex=1.5, col=2 ) for(i in 1:length(Up)){ lines(c(xv2[i], xv2[i]), c(Low[i], Up[i]), col=6) }
Calculates the root mean square curvatures (intrinsic and parameter-effects curvatures) of a nonlinear regression model.
curvIPEC(expr, theta, x, y, tol = 1e-16, alpha = 0.05, method = "Richardson", method.args = list(eps = 1e-04, d = 0.11, zero.tol = sqrt(.Machine$double.eps/7e-07), r = 6, v = 2, show.details = FALSE), side = NULL)
curvIPEC(expr, theta, x, y, tol = 1e-16, alpha = 0.05, method = "Richardson", method.args = list(eps = 1e-04, d = 0.11, zero.tol = sqrt(.Machine$double.eps/7e-07), r = 6, v = 2, show.details = FALSE), side = NULL)
expr |
A given parametric model |
theta |
A vector of parameters of the model |
x |
A vector or matrix of observations of independent variable(s) |
y |
A vector of observations of response variable |
tol |
The tolerance for detecting linear dependencies in the columns of a matrix in the QR decomposition.
See the input argument of |
alpha |
Parameter controlling the significance level for testing the significance of a curvature |
method |
It is the same as the input argument of |
method.args |
It is the same as the input argument of |
side |
It is the same as the input argument of |
This function was built based on the hessian
and jacobian
functions in package numDeriv,
with reference to the rms.curv
function in package MASS.
However, it is more general without being limited by the deriv3
function in package stats
and nls
class like the rms.curv
function in package MASS. It mainly relies on package numDeriv.
The users only need provide the defined model, the fitted parameter vector, and the observations
of independent and response variables, they will obtain the curvatures. The input argument theta
can be obtained using the fitIPEC
function in the current package, and it also can be obtained using the other nonlinear regression functions.
rms.ic |
The root mean square intrinsic curvature |
rms.pec |
The root mean square parameter-effects curvature |
critical.c |
The critical curvature value |
The calculation precision of curvature mainly depends on the setting of method.args
.
The two important default values in the list of method.args
are d = 0.11
, and r = 6
.
This function cannot be used to calculate the maximum intrinsic and parameter-effects curvatures.
Peijian Shi [email protected], Peter M. Ridland [email protected], David A. Ratkowsky [email protected], Yang Li [email protected].
Bates, D.M and Watts, D.G. (1988) Nonlinear Regression Analysis and its Applications. Wiley, New York. doi:10.1002/9780470316757
Gebremariam, B. (2014) Is nonlinear regression throwing you a curve? New diagnostic and inference tools in the NLIN Procedure. Paper SAS384-2014. http://support.sas.com/resources/papers/proceedings14/SAS384-2014.pdf
Ratkowsky, D.A. (1983) Nonlinear Regression Modeling: A Unified Practical Approach. Marcel Dekker, New York.
Ratkowsky, D.A. (1990) Handbook of Nonlinear Regression Models, Marcel Dekker, New York.
Ratkowsky, D.A. & Reddy, G.V.P. (2017) Empirical model with excellent statistical properties for describing temperature-dependent
developmental rates of insects and mites. Ann. Entomol. Soc. Am. 110, 302309. doi:10.1093/aesa/saw098
derivIPEC
, hessian
in package numDeriv,
jacobian
in package numDeriv, rms.curv
in package MASS
#### Example 1 ################################################################################## # The velocity of the reaction (counts/min^2) under different substrate concentrations # in parts per million (ppm) (Pages 255 and 269 of Bates and Watts 1988) x1 <- c(0.02, 0.02, 0.06, 0.06, 0.11, 0.11, 0.22, 0.22, 0.56, 0.56, 1.10, 1.10) y1 <- c(76, 47, 97, 107, 123, 139, 159, 152, 191, 201, 207, 200) # Define the Michaelis-Menten model MM <- function(theta, x){ theta[1]*x / ( theta[2] + x ) } par1 <- c(212.68490865, 0.06412421) # To calculate curvatures res2 <- curvIPEC(MM, theta=par1, x=x1, y=y1, alpha=0.05, method="Richardson", method.args=list(eps=1e-4, d=0.11, zero.tol=sqrt(.Machine$double.eps/7e-7), r=6, v=2)) res2 ################################################################################################## #### Example 2 ################################################################################### # Development data of female pupae of cotton bollworm (Wu et al. 2009) # References: # Ratkowsky, D.A. and Reddy, G.V.P. (2017) Empirical model with excellent statistical # properties for describing temperature-dependent developmental rates of insects # and mites. Ann. Entomol. Soc. Am. 110, 302-309. # Wu, K., Gong, P. and Ruan, Y. (2009) Estimating developmental rates of # Helicoverpa armigera (Lepidoptera: Noctuidae) pupae at constant and # alternating temperature by nonlinear models. Acta Entomol. Sin. 52, 640-650. # 'x2' is the vector of temperature (in degrees Celsius) # 'D2' is the vector of developmental duration (in d) # 'y2' is the vector of the square root of developmental rate (in 1/d) x2 <- seq(15, 37, by=1) D2 <- c( 41.24,37.16,32.47,26.22,22.71,19.01,16.79,15.63,14.27,12.48, 11.3,10.56,9.69,9.14,8.24,8.02,7.43,7.27,7.35,7.49,7.63,7.9,10.03 ) y2 <- 1/D2 y2 <- sqrt( y2 ) # Define the square root function of the Lobry-Rosso-Flandrois (LRF) model sqrt.LRF <- function(P, x){ ropt <- P[1] Topt <- P[2] Tmin <- P[3] Tmax <- P[4] fun0 <- function(z){ z[z < Tmin] <- Tmin z[z > Tmax] <- Tmax return(z) } x <- fun0(x) if (Tmin >= Tmax | ropt <= 0 | Topt <= Tmin | Topt >= Tmax) temp <- Inf if (Tmax > Tmin & ropt > 0 & Topt > Tmin & Topt < Tmax){ temp <- sqrt( ropt*(x-Tmax)*(x-Tmin)^2/((Topt-Tmin)*((Topt-Tmin )*(x-Topt)-(Topt-Tmax)*(Topt+Tmin-2*x))) ) } return( temp ) } myfun <- sqrt.LRF par2 <- c(0.1382926, 33.4575663, 5.5841244, 38.8282021) # To calculate curvatures resu2 <- curvIPEC( myfun, theta=par2, x=x2, y=y2, alpha=0.05, method="Richardson", method.args=list(eps=1e-4, d=0.11, zero.tol=sqrt(.Machine$double.eps/7e-7), r=6, v=2) ) resu2 ################################################################################################## #### Example 3 ################################################################################### # Height growth data of four species of bamboo (Gramineae: Bambusoideae) # Reference(s): # Shi, P., Fan, M., Ratkowsky, D.A., Huang, J., Wu, H., Chen, L., Fang, S. and # Zhang, C. (2017) Comparison of two ontogenetic growth equations for animals and plants. # Ecol. Model. 349, 1-10. data(shoots) # Choose a species # 1: Phyllostachys iridescens; 2: Phyllostachys mannii; # 3: Pleioblastus maculatus; 4: Sinobambusa tootsik. # 'x3' is the vector of the investigation times (in d) from a specific starting time of growth # 'y3' is the vector of the aboveground height values (in cm) of bamboo shoots at 'x3' ind <- 4 x3 <- shoots$x[shoots$Code == ind] y3 <- shoots$y[shoots$Code == ind] # Define the beta sigmoid model (bsm) bsm <- function(P, x){ P <- cbind(P) if(length(P) !=4 ) {stop("The number of parameters should be 4!")} ropt <- P[1] topt <- P[2] tmin <- P[3] tmax <- P[4] tailor.fun <- function(x){ x[x < tmin] <- tmin x[x > tmax] <- tmax return(x) } x <- tailor.fun(x) ropt*(x-tmin)*(x-2*tmax+topt)/(topt+tmin-2*tmax)*( (x-tmin)/(topt-tmin))^((topt-tmin)/(tmax-topt)) } # Define the simplified beta sigmoid model (simp.bsm) simp.bsm <- function(P, x, tmin=0){ P <- cbind(P) ropt <- P[1] topt <- P[2] tmax <- P[3] tailor.fun <- function(x){ x[x < tmin] <- tmin x[x > tmax] <- tmax return(x) } x <- tailor.fun(x) ropt*(x-tmin)*(x-2*tmax+topt)/(topt+tmin-2*tmax)*( (x-tmin)/(topt-tmin))^((topt-tmin)/(tmax-topt)) } # For the original beta sigmoid model ini.val2 <- c(40, 30, 5, 50) xlab2 <- "Time (d)" ylab2 <- "Height (cm)" re0 <- fitIPEC( bsm, x=x3, y=y3, ini.val=ini.val2, xlim=NULL, ylim=NULL, xlab=xlab2, ylab=ylab2, fig.opt=TRUE, control=list(trace=FALSE, reltol=1e-20, maxit=50000) ) par3 <- re0$par par3 re1 <- derivIPEC( bsm, theta=par3, x3[20], method="Richardson", method.args=list(eps=1e-4, d=0.11, zero.tol=sqrt(.Machine$double.eps/7e-7), r=6, v=2) ) re1 re2 <- curvIPEC( bsm, theta=par3, x=x3, y=y3, alpha=0.05, method="Richardson", method.args=list(eps=1e-4, d=0.11, zero.tol=sqrt(.Machine$double.eps/7e-7), r=6, v=2) ) re2 # For the simplified beta sigmoid model (in comparison with the original beta sigmoid model) ini.val7 <- c(40, 30, 50) RESU0 <- fitIPEC( simp.bsm, x=x3, y=y3, ini.val=ini.val7, xlim=NULL, ylim=NULL, xlab=xlab2, ylab=ylab2, fig.opt=TRUE, control=list(trace=FALSE, reltol=1e-20, maxit=50000) ) par7 <- RESU0$par par7 RESU2 <- curvIPEC( simp.bsm, theta=par7, x=x3, y=y3, alpha=0.05, method="Richardson", method.args=list(eps=1e-4, d=0.11, zero.tol=sqrt(.Machine$double.eps/7e-7), r=6, v=2) ) RESU2 ################################################################################################## #### Example 4 ################################################################################### # Weight of cut grass data (Pattinson 1981) # References: # Clarke, G.P.Y. (1987) Approximate confidence limits for a parameter function in nonlinear # regression. J. Am. Stat. Assoc. 82, 221-230. # Gebremariam, B. (2014) Is nonlinear regression throwing you a curve? # New diagnostic and inference tools in the NLIN Procedure. Paper SAS384-2014. # http://support.sas.com/resources/papers/proceedings14/SAS384-2014.pdf # Pattinson, N.B. (1981) Dry Matter Intake: An Estimate of the Animal # Response to Herbage on Offer. unpublished M.Sc. thesis, University # of Natal, Pietermaritzburg, South Africa, Department of Grassland Science. # 'x4' is the vector of weeks after commencement of grazing in a pasture # 'y4' is the vector of weight of cut grass from 10 randomly sited quadrants x4 <- 1:13 y4 <- c(3.183, 3.059, 2.871, 2.622, 2.541, 2.184, 2.110, 2.075, 2.018, 1.903, 1.770, 1.762, 1.550) # Define the first case of Mitscherlich equation MitA <- function(P1, x){ P1[3] + P1[2]*exp(P1[1]*x) } # Define the second case of Mitscherlich equation MitB <- function(P2, x){ log( P2[3] ) + exp(P2[2] + P2[1]*x) } # Define the third case of Mitscherlich equation MitC <- function(P3, x, x1=1, x2=13){ theta1 <- P3[1] beta2 <- P3[2] beta3 <- P3[3] theta2 <- (beta3 - beta2)/(exp(theta1*x2)-exp(theta1*x1)) theta3 <- beta2/(1-exp(theta1*(x1-x2))) - beta3/(exp(theta1*(x2-x1))-1) theta3 + theta2*exp(theta1*x) } ini.val3 <- c(-0.1, 2.5, 1) r0 <- fitIPEC( MitA, x=x4, y=y4, ini.val=ini.val3, xlim=NULL, ylim=NULL, fig.opt=TRUE, control=list( trace=FALSE, reltol=1e-20, maxit=50000) ) parA <- r0$par parA r2 <- curvIPEC( MitA, theta=parA, x=x4, y=y4, alpha=0.05, method="Richardson", method.args=list(eps=1e-4, d=0.11, zero.tol=sqrt(.Machine$double.eps/7e-7), r=6, v=2) ) r2 ini.val4 <- c(exp(-0.1), log(2.5), 1) R0 <- fitIPEC( MitB, x=x4, y=y4, ini.val=ini.val3, xlim=NULL, ylim=NULL, fig.opt=TRUE, control=list( trace=FALSE, reltol=1e-20, maxit=50000) ) parB <- R0$par parB R2 <- curvIPEC( MitB, theta=parB, x=x4, y=y4, alpha=0.05, method="Richardson", method.args=list(eps=1e-4, d=0.11, zero.tol=sqrt(.Machine$double.eps/7e-7), r=6, v=2) ) R2 ini.val6 <- c(-0.15, 2.52, 1.09) RES0 <- fitIPEC( MitC, x=x4, y=y4, ini.val=ini.val6, xlim=NULL, ylim=NULL, fig.opt=TRUE, control=list(trace=FALSE, reltol=1e-20, maxit=50000) ) parC <- RES0$par parC RES2 <- curvIPEC( MitC, theta=parC, x=x4, y=y4, tol=1e-20, alpha=0.05, method="Richardson", method.args=list(eps=1e-4, d=0.11, zero.tol=sqrt(.Machine$double.eps/7e-7), r=6, v=2) ) RES2 ################################################################################################## #### Example 5 ################################################################################### # Conductance of a thermistor (y5) as a function of temperature (x5) (Meyer and Roth, 1972) # References: # Page 120 in Ratkowsky (1983) # Meyer, R.R. and Roth P.M. (1972) Modified damped least squares: # A algorithm for non-linear estimation. J. Inst. Math. Appl. 9, 218-233. x5 <- seq(50, 125, by=5) y5 <- c( 34780, 28610, 23650, 19630, 16370, 13720, 11540, 9744, 8261, 7030, 6005, 5147, 4427, 3820, 3307, 2872 ) y5 <- log(y5) conduct.fun <- function(P, x){ -P[1]+P[2]/(x+P[3]) } ini.val5 <- c(5, 10^4, 0.5*10^3) RE0 <- fitIPEC( conduct.fun, x=x5, y=y5, ini.val=ini.val5, xlim=NULL, ylim=NULL, fig.opt=TRUE, control=list( trace=FALSE, reltol=1e-20, maxit=50000) ) par5 <- RE0$par par5 RE2 <- curvIPEC( conduct.fun, theta=par5, x=x5, y=y5, alpha=0.05, method="Richardson", method.args=list(eps=1e-4, d=0.11, zero.tol=sqrt(.Machine$double.eps/7e-7), r=6, v=2) ) RE2 ################################################################################################## #### Example 6 ################################################################################### # Data on biochemical oxygen demand (BOD; Marske 1967) # References # Pages 255 and 270 in Bates and Watts (1988) # Marske, D. (1967) Biochemical oxygen demand data interpretation using sum of squares surface. # M.Sc. Thesis, University of Wisconsin-Madison. # 'x6' is a vector of time (in d) # 'y6' is a vector of biochemical oxygen demand (mg/l) x6 <- c(1, 2, 3, 4, 5, 7) y6 <- c(8.3, 10.3, 19.0, 16.0, 15.6, 19.8) BOD.fun <- function(P, x){ P[1]*(1-exp(P[2]*x)) } ini.val7 <- c(210, 0.06) consq0 <- fitIPEC( BOD.fun, x=x6, y=y6, ini.val=ini.val7, xlim=NULL, ylim=NULL, fig.opt=TRUE, control=list( trace=FALSE, reltol=1e-20, maxit=50000) ) par7 <- consq0$par par7 consq2 <- curvIPEC( BOD.fun, theta=par7, x=x6, y=y6, alpha=0.05, method="Richardson", method.args=list(eps=1e-4, d=0.11, zero.tol=sqrt(.Machine$double.eps/7e-7), r=6, v=2) ) consq2 ################################################################################################## #### Example 7 ################################################################################### # Data on biochemical oxygen demand (BOD; Marske 1967) # References: # Pages 56, 255 and 271 in Bates and Watts (1988) # Carr, N.L. (1960) Kinetics of catalytic isomerization of n-pentane. Ind. Eng. Chem. # 52, 391-396. data(isom) Y <- isom[,1] X <- isom[,2:4] # There are three independent variables saved in matrix 'X' and one response variable (Y) # The first column of 'X' is the vector of partial pressure of hydrogen # The second column of 'X' is the vector of partial pressure of n-pentane # The third column of 'X' is the vector of partial pressure of isopentane # Y is the vector of experimental reaction rate (in 1/hr) isom.fun <- function(theta, x){ x1 <- x[,1] x2 <- x[,2] x3 <- x[,3] theta1 <- theta[1] theta2 <- theta[2] theta3 <- theta[3] theta4 <- theta[4] theta1*theta3*(x2-x3/1.632) / ( 1 + theta2*x1 + theta3*x2 + theta4*x3 ) } par8 <- c(35.92831619, 0.07084811, 0.03772270, 0.16718384) cons2 <- curvIPEC( isom.fun, theta=par8, x=X, y=Y, alpha=0.05, method="Richardson", method.args=list(eps=1e-4, d=0.11, zero.tol=sqrt(.Machine$double.eps/7e-7), r=6, v=2) ) cons2 ##################################################################################################
#### Example 1 ################################################################################## # The velocity of the reaction (counts/min^2) under different substrate concentrations # in parts per million (ppm) (Pages 255 and 269 of Bates and Watts 1988) x1 <- c(0.02, 0.02, 0.06, 0.06, 0.11, 0.11, 0.22, 0.22, 0.56, 0.56, 1.10, 1.10) y1 <- c(76, 47, 97, 107, 123, 139, 159, 152, 191, 201, 207, 200) # Define the Michaelis-Menten model MM <- function(theta, x){ theta[1]*x / ( theta[2] + x ) } par1 <- c(212.68490865, 0.06412421) # To calculate curvatures res2 <- curvIPEC(MM, theta=par1, x=x1, y=y1, alpha=0.05, method="Richardson", method.args=list(eps=1e-4, d=0.11, zero.tol=sqrt(.Machine$double.eps/7e-7), r=6, v=2)) res2 ################################################################################################## #### Example 2 ################################################################################### # Development data of female pupae of cotton bollworm (Wu et al. 2009) # References: # Ratkowsky, D.A. and Reddy, G.V.P. (2017) Empirical model with excellent statistical # properties for describing temperature-dependent developmental rates of insects # and mites. Ann. Entomol. Soc. Am. 110, 302-309. # Wu, K., Gong, P. and Ruan, Y. (2009) Estimating developmental rates of # Helicoverpa armigera (Lepidoptera: Noctuidae) pupae at constant and # alternating temperature by nonlinear models. Acta Entomol. Sin. 52, 640-650. # 'x2' is the vector of temperature (in degrees Celsius) # 'D2' is the vector of developmental duration (in d) # 'y2' is the vector of the square root of developmental rate (in 1/d) x2 <- seq(15, 37, by=1) D2 <- c( 41.24,37.16,32.47,26.22,22.71,19.01,16.79,15.63,14.27,12.48, 11.3,10.56,9.69,9.14,8.24,8.02,7.43,7.27,7.35,7.49,7.63,7.9,10.03 ) y2 <- 1/D2 y2 <- sqrt( y2 ) # Define the square root function of the Lobry-Rosso-Flandrois (LRF) model sqrt.LRF <- function(P, x){ ropt <- P[1] Topt <- P[2] Tmin <- P[3] Tmax <- P[4] fun0 <- function(z){ z[z < Tmin] <- Tmin z[z > Tmax] <- Tmax return(z) } x <- fun0(x) if (Tmin >= Tmax | ropt <= 0 | Topt <= Tmin | Topt >= Tmax) temp <- Inf if (Tmax > Tmin & ropt > 0 & Topt > Tmin & Topt < Tmax){ temp <- sqrt( ropt*(x-Tmax)*(x-Tmin)^2/((Topt-Tmin)*((Topt-Tmin )*(x-Topt)-(Topt-Tmax)*(Topt+Tmin-2*x))) ) } return( temp ) } myfun <- sqrt.LRF par2 <- c(0.1382926, 33.4575663, 5.5841244, 38.8282021) # To calculate curvatures resu2 <- curvIPEC( myfun, theta=par2, x=x2, y=y2, alpha=0.05, method="Richardson", method.args=list(eps=1e-4, d=0.11, zero.tol=sqrt(.Machine$double.eps/7e-7), r=6, v=2) ) resu2 ################################################################################################## #### Example 3 ################################################################################### # Height growth data of four species of bamboo (Gramineae: Bambusoideae) # Reference(s): # Shi, P., Fan, M., Ratkowsky, D.A., Huang, J., Wu, H., Chen, L., Fang, S. and # Zhang, C. (2017) Comparison of two ontogenetic growth equations for animals and plants. # Ecol. Model. 349, 1-10. data(shoots) # Choose a species # 1: Phyllostachys iridescens; 2: Phyllostachys mannii; # 3: Pleioblastus maculatus; 4: Sinobambusa tootsik. # 'x3' is the vector of the investigation times (in d) from a specific starting time of growth # 'y3' is the vector of the aboveground height values (in cm) of bamboo shoots at 'x3' ind <- 4 x3 <- shoots$x[shoots$Code == ind] y3 <- shoots$y[shoots$Code == ind] # Define the beta sigmoid model (bsm) bsm <- function(P, x){ P <- cbind(P) if(length(P) !=4 ) {stop("The number of parameters should be 4!")} ropt <- P[1] topt <- P[2] tmin <- P[3] tmax <- P[4] tailor.fun <- function(x){ x[x < tmin] <- tmin x[x > tmax] <- tmax return(x) } x <- tailor.fun(x) ropt*(x-tmin)*(x-2*tmax+topt)/(topt+tmin-2*tmax)*( (x-tmin)/(topt-tmin))^((topt-tmin)/(tmax-topt)) } # Define the simplified beta sigmoid model (simp.bsm) simp.bsm <- function(P, x, tmin=0){ P <- cbind(P) ropt <- P[1] topt <- P[2] tmax <- P[3] tailor.fun <- function(x){ x[x < tmin] <- tmin x[x > tmax] <- tmax return(x) } x <- tailor.fun(x) ropt*(x-tmin)*(x-2*tmax+topt)/(topt+tmin-2*tmax)*( (x-tmin)/(topt-tmin))^((topt-tmin)/(tmax-topt)) } # For the original beta sigmoid model ini.val2 <- c(40, 30, 5, 50) xlab2 <- "Time (d)" ylab2 <- "Height (cm)" re0 <- fitIPEC( bsm, x=x3, y=y3, ini.val=ini.val2, xlim=NULL, ylim=NULL, xlab=xlab2, ylab=ylab2, fig.opt=TRUE, control=list(trace=FALSE, reltol=1e-20, maxit=50000) ) par3 <- re0$par par3 re1 <- derivIPEC( bsm, theta=par3, x3[20], method="Richardson", method.args=list(eps=1e-4, d=0.11, zero.tol=sqrt(.Machine$double.eps/7e-7), r=6, v=2) ) re1 re2 <- curvIPEC( bsm, theta=par3, x=x3, y=y3, alpha=0.05, method="Richardson", method.args=list(eps=1e-4, d=0.11, zero.tol=sqrt(.Machine$double.eps/7e-7), r=6, v=2) ) re2 # For the simplified beta sigmoid model (in comparison with the original beta sigmoid model) ini.val7 <- c(40, 30, 50) RESU0 <- fitIPEC( simp.bsm, x=x3, y=y3, ini.val=ini.val7, xlim=NULL, ylim=NULL, xlab=xlab2, ylab=ylab2, fig.opt=TRUE, control=list(trace=FALSE, reltol=1e-20, maxit=50000) ) par7 <- RESU0$par par7 RESU2 <- curvIPEC( simp.bsm, theta=par7, x=x3, y=y3, alpha=0.05, method="Richardson", method.args=list(eps=1e-4, d=0.11, zero.tol=sqrt(.Machine$double.eps/7e-7), r=6, v=2) ) RESU2 ################################################################################################## #### Example 4 ################################################################################### # Weight of cut grass data (Pattinson 1981) # References: # Clarke, G.P.Y. (1987) Approximate confidence limits for a parameter function in nonlinear # regression. J. Am. Stat. Assoc. 82, 221-230. # Gebremariam, B. (2014) Is nonlinear regression throwing you a curve? # New diagnostic and inference tools in the NLIN Procedure. Paper SAS384-2014. # http://support.sas.com/resources/papers/proceedings14/SAS384-2014.pdf # Pattinson, N.B. (1981) Dry Matter Intake: An Estimate of the Animal # Response to Herbage on Offer. unpublished M.Sc. thesis, University # of Natal, Pietermaritzburg, South Africa, Department of Grassland Science. # 'x4' is the vector of weeks after commencement of grazing in a pasture # 'y4' is the vector of weight of cut grass from 10 randomly sited quadrants x4 <- 1:13 y4 <- c(3.183, 3.059, 2.871, 2.622, 2.541, 2.184, 2.110, 2.075, 2.018, 1.903, 1.770, 1.762, 1.550) # Define the first case of Mitscherlich equation MitA <- function(P1, x){ P1[3] + P1[2]*exp(P1[1]*x) } # Define the second case of Mitscherlich equation MitB <- function(P2, x){ log( P2[3] ) + exp(P2[2] + P2[1]*x) } # Define the third case of Mitscherlich equation MitC <- function(P3, x, x1=1, x2=13){ theta1 <- P3[1] beta2 <- P3[2] beta3 <- P3[3] theta2 <- (beta3 - beta2)/(exp(theta1*x2)-exp(theta1*x1)) theta3 <- beta2/(1-exp(theta1*(x1-x2))) - beta3/(exp(theta1*(x2-x1))-1) theta3 + theta2*exp(theta1*x) } ini.val3 <- c(-0.1, 2.5, 1) r0 <- fitIPEC( MitA, x=x4, y=y4, ini.val=ini.val3, xlim=NULL, ylim=NULL, fig.opt=TRUE, control=list( trace=FALSE, reltol=1e-20, maxit=50000) ) parA <- r0$par parA r2 <- curvIPEC( MitA, theta=parA, x=x4, y=y4, alpha=0.05, method="Richardson", method.args=list(eps=1e-4, d=0.11, zero.tol=sqrt(.Machine$double.eps/7e-7), r=6, v=2) ) r2 ini.val4 <- c(exp(-0.1), log(2.5), 1) R0 <- fitIPEC( MitB, x=x4, y=y4, ini.val=ini.val3, xlim=NULL, ylim=NULL, fig.opt=TRUE, control=list( trace=FALSE, reltol=1e-20, maxit=50000) ) parB <- R0$par parB R2 <- curvIPEC( MitB, theta=parB, x=x4, y=y4, alpha=0.05, method="Richardson", method.args=list(eps=1e-4, d=0.11, zero.tol=sqrt(.Machine$double.eps/7e-7), r=6, v=2) ) R2 ini.val6 <- c(-0.15, 2.52, 1.09) RES0 <- fitIPEC( MitC, x=x4, y=y4, ini.val=ini.val6, xlim=NULL, ylim=NULL, fig.opt=TRUE, control=list(trace=FALSE, reltol=1e-20, maxit=50000) ) parC <- RES0$par parC RES2 <- curvIPEC( MitC, theta=parC, x=x4, y=y4, tol=1e-20, alpha=0.05, method="Richardson", method.args=list(eps=1e-4, d=0.11, zero.tol=sqrt(.Machine$double.eps/7e-7), r=6, v=2) ) RES2 ################################################################################################## #### Example 5 ################################################################################### # Conductance of a thermistor (y5) as a function of temperature (x5) (Meyer and Roth, 1972) # References: # Page 120 in Ratkowsky (1983) # Meyer, R.R. and Roth P.M. (1972) Modified damped least squares: # A algorithm for non-linear estimation. J. Inst. Math. Appl. 9, 218-233. x5 <- seq(50, 125, by=5) y5 <- c( 34780, 28610, 23650, 19630, 16370, 13720, 11540, 9744, 8261, 7030, 6005, 5147, 4427, 3820, 3307, 2872 ) y5 <- log(y5) conduct.fun <- function(P, x){ -P[1]+P[2]/(x+P[3]) } ini.val5 <- c(5, 10^4, 0.5*10^3) RE0 <- fitIPEC( conduct.fun, x=x5, y=y5, ini.val=ini.val5, xlim=NULL, ylim=NULL, fig.opt=TRUE, control=list( trace=FALSE, reltol=1e-20, maxit=50000) ) par5 <- RE0$par par5 RE2 <- curvIPEC( conduct.fun, theta=par5, x=x5, y=y5, alpha=0.05, method="Richardson", method.args=list(eps=1e-4, d=0.11, zero.tol=sqrt(.Machine$double.eps/7e-7), r=6, v=2) ) RE2 ################################################################################################## #### Example 6 ################################################################################### # Data on biochemical oxygen demand (BOD; Marske 1967) # References # Pages 255 and 270 in Bates and Watts (1988) # Marske, D. (1967) Biochemical oxygen demand data interpretation using sum of squares surface. # M.Sc. Thesis, University of Wisconsin-Madison. # 'x6' is a vector of time (in d) # 'y6' is a vector of biochemical oxygen demand (mg/l) x6 <- c(1, 2, 3, 4, 5, 7) y6 <- c(8.3, 10.3, 19.0, 16.0, 15.6, 19.8) BOD.fun <- function(P, x){ P[1]*(1-exp(P[2]*x)) } ini.val7 <- c(210, 0.06) consq0 <- fitIPEC( BOD.fun, x=x6, y=y6, ini.val=ini.val7, xlim=NULL, ylim=NULL, fig.opt=TRUE, control=list( trace=FALSE, reltol=1e-20, maxit=50000) ) par7 <- consq0$par par7 consq2 <- curvIPEC( BOD.fun, theta=par7, x=x6, y=y6, alpha=0.05, method="Richardson", method.args=list(eps=1e-4, d=0.11, zero.tol=sqrt(.Machine$double.eps/7e-7), r=6, v=2) ) consq2 ################################################################################################## #### Example 7 ################################################################################### # Data on biochemical oxygen demand (BOD; Marske 1967) # References: # Pages 56, 255 and 271 in Bates and Watts (1988) # Carr, N.L. (1960) Kinetics of catalytic isomerization of n-pentane. Ind. Eng. Chem. # 52, 391-396. data(isom) Y <- isom[,1] X <- isom[,2:4] # There are three independent variables saved in matrix 'X' and one response variable (Y) # The first column of 'X' is the vector of partial pressure of hydrogen # The second column of 'X' is the vector of partial pressure of n-pentane # The third column of 'X' is the vector of partial pressure of isopentane # Y is the vector of experimental reaction rate (in 1/hr) isom.fun <- function(theta, x){ x1 <- x[,1] x2 <- x[,2] x3 <- x[,3] theta1 <- theta[1] theta2 <- theta[2] theta3 <- theta[3] theta4 <- theta[4] theta1*theta3*(x2-x3/1.632) / ( 1 + theta2*x1 + theta3*x2 + theta4*x3 ) } par8 <- c(35.92831619, 0.07084811, 0.03772270, 0.16718384) cons2 <- curvIPEC( isom.fun, theta=par8, x=X, y=Y, alpha=0.05, method="Richardson", method.args=list(eps=1e-4, d=0.11, zero.tol=sqrt(.Machine$double.eps/7e-7), r=6, v=2) ) cons2 ##################################################################################################
Calculates the Jacobian and Hessian matrices of model parameters at a number or a vector z
.
derivIPEC(expr, theta, z, method = "Richardson", method.args = list(eps = 1e-04, d = 0.11, zero.tol = sqrt(.Machine$double.eps/7e-07), r = 6, v = 2, show.details = FALSE), side = NULL)
derivIPEC(expr, theta, z, method = "Richardson", method.args = list(eps = 1e-04, d = 0.11, zero.tol = sqrt(.Machine$double.eps/7e-07), r = 6, v = 2, show.details = FALSE), side = NULL)
expr |
A given parametric model |
theta |
A vector of parameters of the model |
z |
A number or a vector where the derivatives are calculated |
method |
It is the same as the input argument of |
method.args |
It is the same as the input argument of |
side |
It is the same as the input argument of |
The Hessian and Jacobian matrices are calculated at a number or a vector z
,
which represents a value of a single independent variable
or a combination of different values of multiple independent variables.
Note: z
actually corresponds to a combination observation of rather
than all
observations. If there is only a preditor,
z
is a numerical value;
there are several predictors,
then z
is a vector corresponding to one combination observation of those predictors.
Jacobian |
The Jacobian matrix of parameters at |
Hessian |
The Hessian matrix of parameters at |
Peijian Shi [email protected], Peter M. Ridland [email protected], David A. Ratkowsky [email protected], Yang Li [email protected].
Bates, D.M and Watts, D.G. (1988) Nonlinear Regression Analysis and its Applications. Wiley, New York. doi:10.1002/9780470316757
Ratkowsky, D.A. (1983) Nonlinear Regression Modeling: A Unified Practical Approach. Marcel Dekker, New York.
Ratkowsky, D.A. (1990) Handbook of Nonlinear Regression Models, Marcel Dekker, New York.
biasIPEC
, skewIPEC
, curvIPEC
, parinfo
,
hessian
in package numDeriv,
jacobian
in package numDeriv
#### Example 1 ##################################################################################### # Define the Michaelis-Menten model MM <- function(theta, x){ theta[1]*x / ( theta[2] + x ) } par1 <- c(212.68490865, 0.06412421) res1 <- derivIPEC(MM, theta=par1, z=0.02, method="Richardson", method.args=list(eps=1e-4, d=0.11, zero.tol=sqrt(.Machine$double.eps/7e-7), r=6, v=2)) res1 #################################################################################################### #### Example 2 ##################################################################################### # Define the square root function of the Lobry-Rosso-Flandrois (LRF) model sqrt.LRF <- function(P, x){ ropt <- P[1] Topt <- P[2] Tmin <- P[3] Tmax <- P[4] fun0 <- function(z){ z[z < Tmin] <- Tmin z[z > Tmax] <- Tmax return(z) } x <- fun0(x) if (Tmin >= Tmax | ropt <= 0 | Topt <= Tmin | Topt >= Tmax) temp <- Inf if (Tmax > Tmin & ropt > 0 & Topt > Tmin & Topt < Tmax){ temp <- sqrt( ropt*(x-Tmax)*(x-Tmin)^2/((Topt-Tmin)*((Topt-Tmin )*(x-Topt)-(Topt-Tmax)*(Topt+Tmin-2*x))) ) } return( temp ) } myfun <- sqrt.LRF par2 <- c(0.1382926, 33.4575663, 5.5841244, 38.8282021) resu1 <- derivIPEC( myfun, theta=par2, z=15, method="Richardson", method.args=list(eps=1e-4, d=0.11, zero.tol=sqrt(.Machine$double.eps/7e-7), r=6, v=2) ) resu1 #################################################################################################### #### Example 3 ##################################################################################### # Weight of cut grass data (Pattinson 1981) # References: # Clarke, G.P.Y. (1987) Approximate confidence limits for a parameter function in nonlinear # regression. J. Am. Stat. Assoc. 82, 221-230. # Gebremariam, B. (2014) Is nonlinear regression throwing you a curve? # New diagnostic and inference tools in the NLIN Procedure. Paper SAS384-2014. # http://support.sas.com/resources/papers/proceedings14/SAS384-2014.pdf # Pattinson, N.B. (1981) Dry Matter Intake: An Estimate of the Animal # Response to Herbage on Offer. unpublished M.Sc. thesis, University # of Natal, Pietermaritzburg, South Africa, Department of Grassland Science. # 'x4' is the vector of weeks after commencement of grazing in a pasture # 'y4' is the vector of weight of cut grass from 10 randomly sited quadrants x4 <- 1:13 y4 <- c(3.183, 3.059, 2.871, 2.622, 2.541, 2.184, 2.110, 2.075, 2.018, 1.903, 1.770, 1.762, 1.550) # Define the third case of Mitscherlich equation MitC <- function(P3, x){ theta1 <- P3[1] beta2 <- P3[2] beta3 <- P3[3] x1 <- 1 x2 <- 13 theta2 <- (beta3 - beta2)/(exp(theta1*x2)-exp(theta1*x1)) theta3 <- beta2/(1-exp(theta1*(x1-x2))) - beta3/(exp(theta1*(x2-x1))-1) theta3 + theta2*exp(theta1*x) } ini.val6 <- c(-0.15, 2.52, 1.09) RES0 <- fitIPEC( MitC, x=x4, y=y4, ini.val=ini.val6, xlim=NULL, ylim=NULL, fig.opt=TRUE, control=list(trace=FALSE, reltol=1e-20, maxit=50000) ) parC <- RES0$par parC RES1 <- derivIPEC( MitC, theta=parC, z=2, method="Richardson", method.args=list(eps=1e-4, d=0.11, zero.tol=sqrt(.Machine$double.eps/7e-7), r=6, v=2) ) RES1 ################################################################################################# #### Example 4 ################################################################################### # Data on biochemical oxygen demand (BOD; Marske 1967) # References: # Pages 56, 255 and 271 in Bates and Watts (1988) # Carr, N.L. (1960) Kinetics of catalytic isomerization of n-pentane. Ind. Eng. Chem. # 52, 391-396. data(isom) Y <- isom[,1] X <- isom[,2:4] # There are three independent variables saved in matrix 'X' and one response variable (Y) # The first column of 'X' is the vector of partial pressure of hydrogen # The second column of 'X' is the vector of partial pressure of n-pentane # The third column of 'X' is the vector of partial pressure of isopentane # Y is the vector of experimental reaction rate (in 1/hr) isom.fun <- function(theta, x){ x1 <- x[,1] x2 <- x[,2] x3 <- x[,3] theta1 <- theta[1] theta2 <- theta[2] theta3 <- theta[3] theta4 <- theta[4] theta1*theta3*(x2-x3/1.632) / ( 1 + theta2*x1 + theta3*x2 + theta4*x3 ) } ini.val8 <- c(35, 0.1, 0.05, 0.2) cons1 <- fitIPEC( isom.fun, x=X, y=Y, ini.val=ini.val8, control=list( trace=FALSE, reltol=1e-20, maxit=50000) ) par8 <- cons1$par Resul1 <- derivIPEC( isom.fun, theta=par8, z=X[1, ], method="Richardson", method.args=list(eps=1e-4, d=0.11, zero.tol=sqrt(.Machine$double.eps/7e-7), r=6, v=2) ) Resul1 ##################################################################################################
#### Example 1 ##################################################################################### # Define the Michaelis-Menten model MM <- function(theta, x){ theta[1]*x / ( theta[2] + x ) } par1 <- c(212.68490865, 0.06412421) res1 <- derivIPEC(MM, theta=par1, z=0.02, method="Richardson", method.args=list(eps=1e-4, d=0.11, zero.tol=sqrt(.Machine$double.eps/7e-7), r=6, v=2)) res1 #################################################################################################### #### Example 2 ##################################################################################### # Define the square root function of the Lobry-Rosso-Flandrois (LRF) model sqrt.LRF <- function(P, x){ ropt <- P[1] Topt <- P[2] Tmin <- P[3] Tmax <- P[4] fun0 <- function(z){ z[z < Tmin] <- Tmin z[z > Tmax] <- Tmax return(z) } x <- fun0(x) if (Tmin >= Tmax | ropt <= 0 | Topt <= Tmin | Topt >= Tmax) temp <- Inf if (Tmax > Tmin & ropt > 0 & Topt > Tmin & Topt < Tmax){ temp <- sqrt( ropt*(x-Tmax)*(x-Tmin)^2/((Topt-Tmin)*((Topt-Tmin )*(x-Topt)-(Topt-Tmax)*(Topt+Tmin-2*x))) ) } return( temp ) } myfun <- sqrt.LRF par2 <- c(0.1382926, 33.4575663, 5.5841244, 38.8282021) resu1 <- derivIPEC( myfun, theta=par2, z=15, method="Richardson", method.args=list(eps=1e-4, d=0.11, zero.tol=sqrt(.Machine$double.eps/7e-7), r=6, v=2) ) resu1 #################################################################################################### #### Example 3 ##################################################################################### # Weight of cut grass data (Pattinson 1981) # References: # Clarke, G.P.Y. (1987) Approximate confidence limits for a parameter function in nonlinear # regression. J. Am. Stat. Assoc. 82, 221-230. # Gebremariam, B. (2014) Is nonlinear regression throwing you a curve? # New diagnostic and inference tools in the NLIN Procedure. Paper SAS384-2014. # http://support.sas.com/resources/papers/proceedings14/SAS384-2014.pdf # Pattinson, N.B. (1981) Dry Matter Intake: An Estimate of the Animal # Response to Herbage on Offer. unpublished M.Sc. thesis, University # of Natal, Pietermaritzburg, South Africa, Department of Grassland Science. # 'x4' is the vector of weeks after commencement of grazing in a pasture # 'y4' is the vector of weight of cut grass from 10 randomly sited quadrants x4 <- 1:13 y4 <- c(3.183, 3.059, 2.871, 2.622, 2.541, 2.184, 2.110, 2.075, 2.018, 1.903, 1.770, 1.762, 1.550) # Define the third case of Mitscherlich equation MitC <- function(P3, x){ theta1 <- P3[1] beta2 <- P3[2] beta3 <- P3[3] x1 <- 1 x2 <- 13 theta2 <- (beta3 - beta2)/(exp(theta1*x2)-exp(theta1*x1)) theta3 <- beta2/(1-exp(theta1*(x1-x2))) - beta3/(exp(theta1*(x2-x1))-1) theta3 + theta2*exp(theta1*x) } ini.val6 <- c(-0.15, 2.52, 1.09) RES0 <- fitIPEC( MitC, x=x4, y=y4, ini.val=ini.val6, xlim=NULL, ylim=NULL, fig.opt=TRUE, control=list(trace=FALSE, reltol=1e-20, maxit=50000) ) parC <- RES0$par parC RES1 <- derivIPEC( MitC, theta=parC, z=2, method="Richardson", method.args=list(eps=1e-4, d=0.11, zero.tol=sqrt(.Machine$double.eps/7e-7), r=6, v=2) ) RES1 ################################################################################################# #### Example 4 ################################################################################### # Data on biochemical oxygen demand (BOD; Marske 1967) # References: # Pages 56, 255 and 271 in Bates and Watts (1988) # Carr, N.L. (1960) Kinetics of catalytic isomerization of n-pentane. Ind. Eng. Chem. # 52, 391-396. data(isom) Y <- isom[,1] X <- isom[,2:4] # There are three independent variables saved in matrix 'X' and one response variable (Y) # The first column of 'X' is the vector of partial pressure of hydrogen # The second column of 'X' is the vector of partial pressure of n-pentane # The third column of 'X' is the vector of partial pressure of isopentane # Y is the vector of experimental reaction rate (in 1/hr) isom.fun <- function(theta, x){ x1 <- x[,1] x2 <- x[,2] x3 <- x[,3] theta1 <- theta[1] theta2 <- theta[2] theta3 <- theta[3] theta4 <- theta[4] theta1*theta3*(x2-x3/1.632) / ( 1 + theta2*x1 + theta3*x2 + theta4*x3 ) } ini.val8 <- c(35, 0.1, 0.05, 0.2) cons1 <- fitIPEC( isom.fun, x=X, y=Y, ini.val=ini.val8, control=list( trace=FALSE, reltol=1e-20, maxit=50000) ) par8 <- cons1$par Resul1 <- derivIPEC( isom.fun, theta=par8, z=X[1, ], method="Richardson", method.args=list(eps=1e-4, d=0.11, zero.tol=sqrt(.Machine$double.eps/7e-7), r=6, v=2) ) Resul1 ##################################################################################################
Estimates the parameters of a given parametric model
using the optim
function in package stats.
fitIPEC( expr, x, y, ini.val, weights = NULL, control = list(), fig.opt = TRUE, xlim = NULL, ylim = NULL, xlab = NULL, ylab = NULL )
fitIPEC( expr, x, y, ini.val, weights = NULL, control = list(), fig.opt = TRUE, xlim = NULL, ylim = NULL, xlab = NULL, ylab = NULL )
expr |
A given parametric model |
x |
A vector or matrix of observations of independent variable(s) |
y |
A vector of observations of response variable |
ini.val |
A vector or list of initial values of model parameters |
weights |
An optional vector of weights to be used in the fitting process.
|
control |
A list of control parameters for using
the |
fig.opt |
An option to determine whether to draw the fitted curve |
xlim |
The shown range of the x-axis |
ylim |
The shown range of the y-axis |
xlab |
The label of the x-axis |
ylab |
The label of the y-axis |
The Nelder-Mead algorithm is the default in the optim
function in package stats.
The user can accurately estimate the model parameters by setting smaller relative convergence
tolerance and larger maximum number of iterations in the input argument of control
,
e.g. control=list(trace=FALSE, reltol=1e-20, maxit=50000)
,
at the expense of the running speed.
ini.val
can be a vector or a list that has saved initial values for model parameters,
e.g. y = beta0 + beta1 * x + beta2 * x^2
,
ini.val = list(beta0=seq(5, 15, len=2), beta1=seq(0.1, 1, len=9),
beta2=seq(0.01, 0.05, len=5))
, which is similar to the usage of the
input argument of start
of nls
in package stats.
In the weights
argument option, the default is weights = NULL
.
In that case, ordinary least squares is used.
The residual sum of squares (RSS) between the observed and predicted values
is minimized to estimate a model's parameters, i.e.,
where and
represent the observed and predicted
values, respectively;
and
represents the sample size. If
weights
is a numeric vector,
the weighted residual sum of squares is minimized, i.e.,
where is the
elements of
weights
.
expr |
The formula used |
par |
The vector of estimates of parameters |
RSS |
The residual sum of squares or the weighted residual sum of squares |
R.sq |
The coefficient of determination or the weighted coefficient of determination |
n |
The number of data points, namely the sample size |
This function can be applicable to a nonlinear parametric model with a single independent variable or with multiple independent variables.
R.sq
is only used to help users intuitively judge whether the fitted curve seriously
deviates from the actual observations. However, it should NOT be used to decide which of
several competing models is the most appropriate (Pages 4445 in Ratkowsky 1990).
RSS
and curvatures are among the suitable candidates to answer such a question.
Peijian Shi [email protected], Peter M. Ridland [email protected], David A. Ratkowsky [email protected], Yang Li [email protected].
Nelder, J.A. and Mead, R. (1965) A simplex method for function minimization.
Comput. J. 7, 308313. doi:10.1093/comjnl/7.4.308
bootIPEC
, optim
in package stats
#### Example 1 ################################################################################### graphics.off() # The velocity of the reaction (counts/min^2) under different substrate concentrations # in parts per million (ppm) (Page 269 of Bates and Watts 1988) x1 <- c(0.02, 0.02, 0.06, 0.06, 0.11, 0.11, 0.22, 0.22, 0.56, 0.56, 1.10, 1.10) y1 <- c(76, 47, 97, 107, 123, 139, 159, 152, 191, 201, 207, 200) # Define the Michaelis-Menten model MM <- function(theta, x){ theta[1]*x / ( theta[2] + x ) } res0 <- fitIPEC(MM, x=x1, y=y1, ini.val=c(200, 0.05), xlim=c(0, 1.5), ylim=c(0, 250), fig.opt=TRUE) par1 <- res0$par par1 res0 # The input names of parameters will not affect the fitted results. # We can use other names to replace theta1 and theta2. iv.list1 <- list( theta1=seq(100, 300, by=50), theta2=seq(10, 100, by=10) ) result0 <- fitIPEC( MM, x=x1, y=y1, ini.val=iv.list1, xlim=c(0, 1.5), ylim=c(0, 250), fig.opt=FALSE, control=list(trace=FALSE, reltol=1e-20, maxit=50000) ) param1 <- result0$par param1 ################################################################################################## #### Example 2 ################################################################################### graphics.off() # Development data of female pupae of cotton bollworm (Wu et al. 2009) # References: # Ratkowsky, D.A. and Reddy, G.V.P. (2017) Empirical model with excellent statistical # properties for describing temperature-dependent developmental rates of insects # and mites. Ann. Entomol. Soc. Am. 110, 302-309. # Wu, K., Gong, P. and Ruan, Y. (2009) Estimating developmental rates of # Helicoverpa armigera (Lepidoptera: Noctuidae) pupae at constant and # alternating temperature by nonlinear models. Acta Entomol. Sin. 52, 640-650. # 'x2' is the vector of temperature (in degrees Celsius) # 'D2' is the vector of developmental duration (in d) # 'y2' is the vector of the square root of developmental rate (in 1/d) x2 <- seq(15, 37, by=1) D2 <- c(41.24,37.16,32.47,26.22,22.71,19.01,16.79,15.63,14.27,12.48, 11.3,10.56,9.69,9.14,8.24,8.02,7.43,7.27,7.35,7.49,7.63,7.9,10.03) y2 <- 1/D2 y2 <- sqrt( y2 ) ini.val1 <- c(0.14, 30, 10, 40) # Define the square root function of the Lobry-Rosso-Flandrois (LRF) model sqrt.LRF <- function(P, x){ ropt <- P[1] Topt <- P[2] Tmin <- P[3] Tmax <- P[4] fun0 <- function(z){ z[z < Tmin] <- Tmin z[z > Tmax] <- Tmax return(z) } x <- fun0(x) if (Tmin >= Tmax | ropt <= 0 | Topt <= Tmin | Topt >= Tmax) temp <- Inf if (Tmax > Tmin & ropt > 0 & Topt > Tmin & Topt < Tmax){ temp <- sqrt( ropt*(x-Tmax)*(x-Tmin)^2/((Topt-Tmin)*((Topt-Tmin )*(x-Topt)-(Topt-Tmax)*(Topt+Tmin-2*x))) ) } return( temp ) } myfun <- sqrt.LRF xlab1 <- expression( paste("Temperature (", degree, "C)", sep="" ) ) ylab1 <- expression( paste("Developmental rate"^{1/2}, " (", d^{"-1"}, ")", sep="") ) resu0 <- fitIPEC( myfun, x=x2, y=y2, ini.val=ini.val1, xlim=NULL, ylim=NULL, xlab=xlab1, ylab=ylab1, fig.opt=TRUE, control=list(trace=FALSE, reltol=1e-20, maxit=50000) ) par2 <- resu0$par par2 resu0 ################################################################################################## #### Example 3 ################################################################################### graphics.off() # Height growth data of four species of bamboo (Gramineae: Bambusoideae) # Reference(s): # Shi, P., Fan, M., Ratkowsky, D.A., Huang, J., Wu, H., Chen, L., # Fang, S. and Zhang, C. (2017) Comparison of two ontogenetic # growth equations for animals and plants. Ecol. Model. 349, 1-10. data(shoots) # Choose a species # 1: Phyllostachys iridescens; 2: Phyllostachys mannii; # 3: Pleioblastus maculatus; 4: Sinobambusa tootsik # 'x3' is the vector of the investigation times from a specific starting time of growth # 'y3' is the vector of the aboveground height values of bamboo shoots at 'x3' ind <- 4 x3 <- shoots$x[shoots$Code == ind] y3 <- shoots$y[shoots$Code == ind] # Define the beta sigmoid model (bsm) bsm <- function(P, x){ P <- cbind(P) if(length(P) !=4 ) {stop(" The number of parameters should be 4!")} ropt <- P[1] topt <- P[2] tmin <- P[3] tmax <- P[4] tailor.fun <- function(x){ x[x < tmin] <- tmin x[x > tmax] <- tmax return(x) } x <- tailor.fun(x) ropt*(x-tmin)*(x-2*tmax+topt)/(topt+tmin-2*tmax)*( (x-tmin)/(topt-tmin))^((topt-tmin)/(tmax-topt)) } ini.val2 <- c(40, 30, 5, 50) xlab2 <- "Time (d)" ylab2 <- "Height (cm)" re0 <- fitIPEC( bsm, x=x3, y=y3, ini.val=ini.val2, xlim=NULL, ylim=NULL, xlab=xlab2, ylab=ylab2, fig.opt=TRUE, control=list(trace=FALSE, reltol=1e-20, maxit=50000) ) par3 <- re0$par par3 ################################################################################################## #### Example 4 ################################################################################### # Data on biochemical oxygen demand (BOD; Marske 1967) # References: # Pages 56, 255 and 271 in Bates and Watts (1988) # Carr, N.L. (1960) Kinetics of catalytic isomerization of n-pentane. Ind. Eng. Chem. # 52, 391-396. data(isom) Y <- isom[,1] X <- isom[,2:4] # There are three independent variables saved in matrix 'X' and one response variable (Y) # The first column of 'X' is the vector of partial pressure of hydrogen # The second column of 'X' is the vector of partial pressure of n-pentane # The third column of 'X' is the vector of partial pressure of isopentane # Y is the vector of experimental reaction rate (in 1/hr) isom.fun <- function(theta, x){ x1 <- x[,1] x2 <- x[,2] x3 <- x[,3] theta1 <- theta[1] theta2 <- theta[2] theta3 <- theta[3] theta4 <- theta[4] theta1*theta3*(x2-x3/1.632) / ( 1 + theta2*x1 + theta3*x2 + theta4*x3 ) } ini.val8 <- c(35, 0.1, 0.05, 0.2) cons1 <- fitIPEC( isom.fun, x=X, y=Y, ini.val=ini.val8, control=list( trace=FALSE, reltol=1e-20, maxit=50000) ) par8 <- cons1$par ##################################################################################################
#### Example 1 ################################################################################### graphics.off() # The velocity of the reaction (counts/min^2) under different substrate concentrations # in parts per million (ppm) (Page 269 of Bates and Watts 1988) x1 <- c(0.02, 0.02, 0.06, 0.06, 0.11, 0.11, 0.22, 0.22, 0.56, 0.56, 1.10, 1.10) y1 <- c(76, 47, 97, 107, 123, 139, 159, 152, 191, 201, 207, 200) # Define the Michaelis-Menten model MM <- function(theta, x){ theta[1]*x / ( theta[2] + x ) } res0 <- fitIPEC(MM, x=x1, y=y1, ini.val=c(200, 0.05), xlim=c(0, 1.5), ylim=c(0, 250), fig.opt=TRUE) par1 <- res0$par par1 res0 # The input names of parameters will not affect the fitted results. # We can use other names to replace theta1 and theta2. iv.list1 <- list( theta1=seq(100, 300, by=50), theta2=seq(10, 100, by=10) ) result0 <- fitIPEC( MM, x=x1, y=y1, ini.val=iv.list1, xlim=c(0, 1.5), ylim=c(0, 250), fig.opt=FALSE, control=list(trace=FALSE, reltol=1e-20, maxit=50000) ) param1 <- result0$par param1 ################################################################################################## #### Example 2 ################################################################################### graphics.off() # Development data of female pupae of cotton bollworm (Wu et al. 2009) # References: # Ratkowsky, D.A. and Reddy, G.V.P. (2017) Empirical model with excellent statistical # properties for describing temperature-dependent developmental rates of insects # and mites. Ann. Entomol. Soc. Am. 110, 302-309. # Wu, K., Gong, P. and Ruan, Y. (2009) Estimating developmental rates of # Helicoverpa armigera (Lepidoptera: Noctuidae) pupae at constant and # alternating temperature by nonlinear models. Acta Entomol. Sin. 52, 640-650. # 'x2' is the vector of temperature (in degrees Celsius) # 'D2' is the vector of developmental duration (in d) # 'y2' is the vector of the square root of developmental rate (in 1/d) x2 <- seq(15, 37, by=1) D2 <- c(41.24,37.16,32.47,26.22,22.71,19.01,16.79,15.63,14.27,12.48, 11.3,10.56,9.69,9.14,8.24,8.02,7.43,7.27,7.35,7.49,7.63,7.9,10.03) y2 <- 1/D2 y2 <- sqrt( y2 ) ini.val1 <- c(0.14, 30, 10, 40) # Define the square root function of the Lobry-Rosso-Flandrois (LRF) model sqrt.LRF <- function(P, x){ ropt <- P[1] Topt <- P[2] Tmin <- P[3] Tmax <- P[4] fun0 <- function(z){ z[z < Tmin] <- Tmin z[z > Tmax] <- Tmax return(z) } x <- fun0(x) if (Tmin >= Tmax | ropt <= 0 | Topt <= Tmin | Topt >= Tmax) temp <- Inf if (Tmax > Tmin & ropt > 0 & Topt > Tmin & Topt < Tmax){ temp <- sqrt( ropt*(x-Tmax)*(x-Tmin)^2/((Topt-Tmin)*((Topt-Tmin )*(x-Topt)-(Topt-Tmax)*(Topt+Tmin-2*x))) ) } return( temp ) } myfun <- sqrt.LRF xlab1 <- expression( paste("Temperature (", degree, "C)", sep="" ) ) ylab1 <- expression( paste("Developmental rate"^{1/2}, " (", d^{"-1"}, ")", sep="") ) resu0 <- fitIPEC( myfun, x=x2, y=y2, ini.val=ini.val1, xlim=NULL, ylim=NULL, xlab=xlab1, ylab=ylab1, fig.opt=TRUE, control=list(trace=FALSE, reltol=1e-20, maxit=50000) ) par2 <- resu0$par par2 resu0 ################################################################################################## #### Example 3 ################################################################################### graphics.off() # Height growth data of four species of bamboo (Gramineae: Bambusoideae) # Reference(s): # Shi, P., Fan, M., Ratkowsky, D.A., Huang, J., Wu, H., Chen, L., # Fang, S. and Zhang, C. (2017) Comparison of two ontogenetic # growth equations for animals and plants. Ecol. Model. 349, 1-10. data(shoots) # Choose a species # 1: Phyllostachys iridescens; 2: Phyllostachys mannii; # 3: Pleioblastus maculatus; 4: Sinobambusa tootsik # 'x3' is the vector of the investigation times from a specific starting time of growth # 'y3' is the vector of the aboveground height values of bamboo shoots at 'x3' ind <- 4 x3 <- shoots$x[shoots$Code == ind] y3 <- shoots$y[shoots$Code == ind] # Define the beta sigmoid model (bsm) bsm <- function(P, x){ P <- cbind(P) if(length(P) !=4 ) {stop(" The number of parameters should be 4!")} ropt <- P[1] topt <- P[2] tmin <- P[3] tmax <- P[4] tailor.fun <- function(x){ x[x < tmin] <- tmin x[x > tmax] <- tmax return(x) } x <- tailor.fun(x) ropt*(x-tmin)*(x-2*tmax+topt)/(topt+tmin-2*tmax)*( (x-tmin)/(topt-tmin))^((topt-tmin)/(tmax-topt)) } ini.val2 <- c(40, 30, 5, 50) xlab2 <- "Time (d)" ylab2 <- "Height (cm)" re0 <- fitIPEC( bsm, x=x3, y=y3, ini.val=ini.val2, xlim=NULL, ylim=NULL, xlab=xlab2, ylab=ylab2, fig.opt=TRUE, control=list(trace=FALSE, reltol=1e-20, maxit=50000) ) par3 <- re0$par par3 ################################################################################################## #### Example 4 ################################################################################### # Data on biochemical oxygen demand (BOD; Marske 1967) # References: # Pages 56, 255 and 271 in Bates and Watts (1988) # Carr, N.L. (1960) Kinetics of catalytic isomerization of n-pentane. Ind. Eng. Chem. # 52, 391-396. data(isom) Y <- isom[,1] X <- isom[,2:4] # There are three independent variables saved in matrix 'X' and one response variable (Y) # The first column of 'X' is the vector of partial pressure of hydrogen # The second column of 'X' is the vector of partial pressure of n-pentane # The third column of 'X' is the vector of partial pressure of isopentane # Y is the vector of experimental reaction rate (in 1/hr) isom.fun <- function(theta, x){ x1 <- x[,1] x2 <- x[,2] x3 <- x[,3] theta1 <- theta[1] theta2 <- theta[2] theta3 <- theta[3] theta4 <- theta[4] theta1*theta3*(x2-x3/1.632) / ( 1 + theta2*x1 + theta3*x2 + theta4*x3 ) } ini.val8 <- c(35, 0.1, 0.05, 0.2) cons1 <- fitIPEC( isom.fun, x=X, y=Y, ini.val=ini.val8, control=list( trace=FALSE, reltol=1e-20, maxit=50000) ) par8 <- cons1$par ##################################################################################################
Data on the reaction rate of the catalytic isomerization of n-pentane to isopentane versus the partial pressures of hydrogen, n-pentane, and isopentane.
data(isom)
data(isom)
There are four columns in the data set:
'y' is the vector of experimental reaction rate (in 1/hr);
'x1' is the vector of partial pressure of hydrogen;
'x2' is the vector of partial pressure of n-pentane;
'x3' is the vector of partial pressure of isopentane.
There were errors about the definitions of 'x2' and 'x3' in page 272 in Bates and Watts (1988). Here, we redefined them according to the paper of Carr (1960).
Bates, D.M and Watts, D.G. (1988) Nonlinear Regression Analysis and its Applications. Wiley, New York. doi:10.1002/9780470316757
Carr, N.L. (1960) Kinetics of catalytic isomerization of n-pentane. Ind. Eng. Chem. 52, 391396.
data(isom) isom Y <- isom[,1] X <- isom[,2:4] X Y
data(isom) isom Y <- isom[,1] X <- isom[,2:4] X Y
The data consist of the area, length and width of the leaves of 10 geographical populations of P. subaequalis collected in Southern China from July to September, 2016.
data(leaves)
data(leaves)
In the data set, there are four variables: PopuCode
, Length
, Width
and Area
.
PopuCode
is used to save the number codes of different geographical populations;
Length
is used to save the scanned leaf length data (cm);
Width
is used to save the scanned leaf width data (cm);
Area
is used to save the scanned leaf area data (cm squared).
Wang, P., Ratkowsky, D.A., Xiao, X., Yu, X., Su, J., Zhang, L. and Shi, P. (2018) Taylor's power law for leaf bilateral symmetry. Forests 9, 500. doi:10.3390/f9080500
data(leaves) attach(leaves) # Choose a geographical population (see Table S1 in Wang et al. [2018] for details) # 1: AJ; 2: HN; 3: HW; 4: HZ; 5: JD; # 6: JS; 7: SC; 8: TC; 9: TT; 10: TX ind <- 1 L <- Length[PopuCode == ind] W <- Width[PopuCode == ind] A <- Area[PopuCode == ind] x <- L*W fit <- lm(A ~ x-1) summary(fit) # Show the leaf areas of the 10 geographical populations dev.new() boxplot(Area~PopuCode, cex=1.5, cex.lab=1.5, cex.axis=1.5, col="grey70", xlab=expression(bold("Population code")), ylab=expression(bold(paste("Leaf area (cm", ""^{"2"}, ")", sep=""))), ylim=c(0, 50), xaxs="i", yaxs="i", las=1)
data(leaves) attach(leaves) # Choose a geographical population (see Table S1 in Wang et al. [2018] for details) # 1: AJ; 2: HN; 3: HW; 4: HZ; 5: JD; # 6: JS; 7: SC; 8: TC; 9: TT; 10: TX ind <- 1 L <- Length[PopuCode == ind] W <- Width[PopuCode == ind] A <- Area[PopuCode == ind] x <- L*W fit <- lm(A ~ x-1) summary(fit) # Show the leaf areas of the 10 geographical populations dev.new() boxplot(Area~PopuCode, cex=1.5, cex.lab=1.5, cex.axis=1.5, col="grey70", xlab=expression(bold("Population code")), ylab=expression(bold(paste("Leaf area (cm", ""^{"2"}, ")", sep=""))), ylim=c(0, 50), xaxs="i", yaxs="i", las=1)
Provides the estimates, standard errors, confidence intervals, Jacobian matrix, and the covariance matrix of model parameters.
parinfo(object, x, CI = 0.95, method = "Richardson", method.args = list(eps = 1e-04, d = 0.11, zero.tol = sqrt(.Machine$double.eps/7e-07), r = 6, v = 2, show.details = FALSE), side = NULL)
parinfo(object, x, CI = 0.95, method = "Richardson", method.args = list(eps = 1e-04, d = 0.11, zero.tol = sqrt(.Machine$double.eps/7e-07), r = 6, v = 2, show.details = FALSE), side = NULL)
object |
A fitted model object for which there exist the model expression( |
x |
A vector or a matrix of observations of independent variable(s) |
CI |
The confidence level(s) of the required interval(s) |
method |
It is the same as the input argument of |
method.args |
It is the same as the input argument of |
side |
It is the same as the input argument of |
The object
argument cannot be a list. It is a fitted model object from using the fitIPEC
function.
D |
The Jacobian matrix of model parameters at all the |
partab |
The estimates, standard errors and confidence intervals of model parameters |
covmat |
The covariance matrix of model parameters |
When there are sample.size
and n
in object
at the same time, the default of
the sample size is sample.size
, which is superior to n
.
Peijian Shi [email protected], Peter M. Ridland [email protected], David A. Ratkowsky [email protected], Yang Li [email protected].
Bates, D.M and Watts, D.G. (1988) Nonlinear Regression Analysis and its Applications. Wiley, New York. doi:10.1002/9780470316757
Ratkowsky, D.A. (1983) Nonlinear Regression Modeling: A Unified Practical Approach. Marcel Dekker, New York.
Ratkowsky, D.A. (1990) Handbook of Nonlinear Regression Models, Marcel Dekker, New York.
biasIPEC
, confcurves
, curvIPEC
, skewIPEC
,
hessian
in package numDeriv,
jacobian
in package numDeriv
#### Example 1 ################################################################################### # Weight of cut grass data (Pattinson 1981) # References: # Clarke, G.P.Y. (1987) Approximate confidence limits for a parameter function in nonlinear # regression. J. Am. Stat. Assoc. 82, 221-230. # Gebremariam, B. (2014) Is nonlinear regression throwing you a curve? # New diagnostic and inference tools in the NLIN Procedure. Paper SAS384-2014. # http://support.sas.com/resources/papers/proceedings14/SAS384-2014.pdf # Pattinson, N.B. (1981) Dry Matter Intake: An Estimate of the Animal # Response to Herbage on Offer. unpublished M.Sc. thesis, University # of Natal, Pietermaritzburg, South Africa, Department of Grassland Science. # 'x4' is the vector of weeks after commencement of grazing in a pasture # 'y4' is the vector of weight of cut grass from 10 randomly sited quadrants x4 <- 1:13 y4 <- c(3.183, 3.059, 2.871, 2.622, 2.541, 2.184, 2.110, 2.075, 2.018, 1.903, 1.770, 1.762, 1.550) # Define the first case of Mitscherlich equation MitA <- function(P1, x){ P1[3] + P1[2]*exp(P1[1]*x) } # Define the second case of Mitscherlich equation MitB <- function(P2, x){ log( P2[3] ) + exp(P2[2] + P2[1]*x) } # Define the third case of Mitscherlich equation MitC <- function(P3, x, x1=1, x2=13){ theta1 <- P3[1] beta2 <- P3[2] beta3 <- P3[3] theta2 <- (beta3 - beta2)/(exp(theta1*x2)-exp(theta1*x1)) theta3 <- beta2/(1-exp(theta1*(x1-x2))) - beta3/(exp(theta1*(x2-x1))-1) theta3 + theta2*exp(theta1*x) } ini.val3 <- c(-0.1, 2.5, 1) r1 <- fitIPEC( MitA, x=x4, y=y4, ini.val=ini.val3, xlim=NULL, ylim=NULL, fig.opt=TRUE, control=list( trace=FALSE, reltol=1e-20, maxit=50000) ) parA <- r1$par parA result1 <- parinfo(r1, x=x4, CI=0.95) result1 ini.val4 <- c(-0.10, 0.90, 2.5) R0 <- fitIPEC( MitB, x=x4, y=y4, ini.val=ini.val4, xlim=NULL, ylim=NULL, fig.opt=TRUE, control=list( trace=FALSE, reltol=1e-20, maxit=50000) ) parB <- R0$par parB result2 <- parinfo(R0, x=x4, CI=0.95) result2 ini.val6 <- c(-0.15, 2.52, 1.09) RES0 <- fitIPEC( MitC, x=x4, y=y4, ini.val=ini.val6, xlim=NULL, ylim=NULL, fig.opt=TRUE, control=list(trace=FALSE, reltol=1e-20, maxit=50000) ) parC <- RES0$par parC result3 <- parinfo(RES0, x=x4, CI=0.95) result3 ################################################################################################## #### Example 2 ################################################################################### # Data on biochemical oxygen demand (BOD; Marske 1967) # References: # Pages 56, 255 and 271 in Bates and Watts (1988) # Carr, N.L. (1960) Kinetics of catalytic isomerization of n-pentane. Ind. Eng. Chem. # 52, 391-396. data(isom) Y <- isom[,1] X <- isom[,2:4] # There are three independent variables saved in matrix 'X' and one response variable (Y) # The first column of 'X' is the vector of partial pressure of hydrogen # The second column of 'X' is the vector of partial pressure of n-pentane # The third column of 'X' is the vector of partial pressure of isopentane # Y is the vector of experimental reaction rate (in 1/hr) isom.fun <- function(theta, x){ x1 <- x[,1] x2 <- x[,2] x3 <- x[,3] theta1 <- theta[1] theta2 <- theta[2] theta3 <- theta[3] theta4 <- theta[4] theta1*theta3*(x2-x3/1.632) / ( 1 + theta2*x1 + theta3*x2 + theta4*x3 ) } ini.val8 <- c(35, 0.1, 0.05, 0.2) cons1 <- fitIPEC( isom.fun, x=X, y=Y, ini.val=ini.val8, control=list( trace=FALSE, reltol=1e-20, maxit=50000) ) par8 <- cons1$par result2 <- parinfo(cons1, x=X, CI=0.95) result2 ################################################################################################## graphics.off()
#### Example 1 ################################################################################### # Weight of cut grass data (Pattinson 1981) # References: # Clarke, G.P.Y. (1987) Approximate confidence limits for a parameter function in nonlinear # regression. J. Am. Stat. Assoc. 82, 221-230. # Gebremariam, B. (2014) Is nonlinear regression throwing you a curve? # New diagnostic and inference tools in the NLIN Procedure. Paper SAS384-2014. # http://support.sas.com/resources/papers/proceedings14/SAS384-2014.pdf # Pattinson, N.B. (1981) Dry Matter Intake: An Estimate of the Animal # Response to Herbage on Offer. unpublished M.Sc. thesis, University # of Natal, Pietermaritzburg, South Africa, Department of Grassland Science. # 'x4' is the vector of weeks after commencement of grazing in a pasture # 'y4' is the vector of weight of cut grass from 10 randomly sited quadrants x4 <- 1:13 y4 <- c(3.183, 3.059, 2.871, 2.622, 2.541, 2.184, 2.110, 2.075, 2.018, 1.903, 1.770, 1.762, 1.550) # Define the first case of Mitscherlich equation MitA <- function(P1, x){ P1[3] + P1[2]*exp(P1[1]*x) } # Define the second case of Mitscherlich equation MitB <- function(P2, x){ log( P2[3] ) + exp(P2[2] + P2[1]*x) } # Define the third case of Mitscherlich equation MitC <- function(P3, x, x1=1, x2=13){ theta1 <- P3[1] beta2 <- P3[2] beta3 <- P3[3] theta2 <- (beta3 - beta2)/(exp(theta1*x2)-exp(theta1*x1)) theta3 <- beta2/(1-exp(theta1*(x1-x2))) - beta3/(exp(theta1*(x2-x1))-1) theta3 + theta2*exp(theta1*x) } ini.val3 <- c(-0.1, 2.5, 1) r1 <- fitIPEC( MitA, x=x4, y=y4, ini.val=ini.val3, xlim=NULL, ylim=NULL, fig.opt=TRUE, control=list( trace=FALSE, reltol=1e-20, maxit=50000) ) parA <- r1$par parA result1 <- parinfo(r1, x=x4, CI=0.95) result1 ini.val4 <- c(-0.10, 0.90, 2.5) R0 <- fitIPEC( MitB, x=x4, y=y4, ini.val=ini.val4, xlim=NULL, ylim=NULL, fig.opt=TRUE, control=list( trace=FALSE, reltol=1e-20, maxit=50000) ) parB <- R0$par parB result2 <- parinfo(R0, x=x4, CI=0.95) result2 ini.val6 <- c(-0.15, 2.52, 1.09) RES0 <- fitIPEC( MitC, x=x4, y=y4, ini.val=ini.val6, xlim=NULL, ylim=NULL, fig.opt=TRUE, control=list(trace=FALSE, reltol=1e-20, maxit=50000) ) parC <- RES0$par parC result3 <- parinfo(RES0, x=x4, CI=0.95) result3 ################################################################################################## #### Example 2 ################################################################################### # Data on biochemical oxygen demand (BOD; Marske 1967) # References: # Pages 56, 255 and 271 in Bates and Watts (1988) # Carr, N.L. (1960) Kinetics of catalytic isomerization of n-pentane. Ind. Eng. Chem. # 52, 391-396. data(isom) Y <- isom[,1] X <- isom[,2:4] # There are three independent variables saved in matrix 'X' and one response variable (Y) # The first column of 'X' is the vector of partial pressure of hydrogen # The second column of 'X' is the vector of partial pressure of n-pentane # The third column of 'X' is the vector of partial pressure of isopentane # Y is the vector of experimental reaction rate (in 1/hr) isom.fun <- function(theta, x){ x1 <- x[,1] x2 <- x[,2] x3 <- x[,3] theta1 <- theta[1] theta2 <- theta[2] theta3 <- theta[3] theta4 <- theta[4] theta1*theta3*(x2-x3/1.632) / ( 1 + theta2*x1 + theta3*x2 + theta4*x3 ) } ini.val8 <- c(35, 0.1, 0.05, 0.2) cons1 <- fitIPEC( isom.fun, x=X, y=Y, ini.val=ini.val8, control=list( trace=FALSE, reltol=1e-20, maxit=50000) ) par8 <- cons1$par result2 <- parinfo(cons1, x=X, CI=0.95) result2 ################################################################################################## graphics.off()
The height growth data of four species of bamboo at the Nanjing Forestry University campus in 2016.
data(shoots)
data(shoots)
In the data set, there are four variables: Code
, LatinName
, x
and y
.
Code
is used to save the number codes of different bamboo species;
LatinName
is used to save the Latin names of different bamboo species;
x
is used to save the investigation times (d) from a specific starting time of growth,
and every bamboo has a different starting time of growth;
y
is used to save the measured aboveground height values (cm).
Code = 1
represents Phyllostachys iridescens, and the starting time (namely x = 0
) was defined as 12:00, 3rd April, 2016;
Code = 2
represents Phyllostachys mannii, and the starting time (namely x = 0
) was defined as 12:00, 4th April, 2016;
Code = 3
represents Pleioblastus maculatus, and the starting time (namely x = 0
) was defined as 12:00, 29th April, 2016;
Code = 4
represents Sinobambusa tootsik, and the starting time (namely x = 0
) was defined as 12:00, 18th April, 2016.
Shi, P., Fan, M., Ratkowsky, D.A., Huang, J., Wu, H., Chen, L., Fang, S. and
Zhang, C. (2017) Comparison of two ontogenetic growth equations for animals and plants.
Ecol. Model. 349, 110. doi:10.1016/j.ecolmodel.2017.01.012
data(shoots) # Choose a species # 1: Phyllostachys iridescens; 2: Phyllostachys mannii; # 3: Pleioblastus maculatus; 4: Sinobambusa tootsik. ind <- 4 x3 <- shoots$x[shoots$Code == ind] y3 <- shoots$y[shoots$Code == ind] dev.new() plot(x3, y3, cex=1.5, cex.lab=1.5, cex.axis=1.5, xlab="Time (d)", ylab="Height (cm)")
data(shoots) # Choose a species # 1: Phyllostachys iridescens; 2: Phyllostachys mannii; # 3: Pleioblastus maculatus; 4: Sinobambusa tootsik. ind <- 4 x3 <- shoots$x[shoots$Code == ind] y3 <- shoots$y[shoots$Code == ind] dev.new() plot(x3, y3, cex=1.5, cex.lab=1.5, cex.axis=1.5, xlab="Time (d)", ylab="Height (cm)")
Calculates the skewness in the estimates of the parameters of a given model.
skewIPEC( expr, theta, x, y, tol = sqrt(.Machine$double.eps), method = "Richardson", method.args = list(eps = 1e-04, d = 0.11, zero.tol = sqrt(.Machine$double.eps/7e-07), r = 6, v = 2, show.details = FALSE), side = NULL )
skewIPEC( expr, theta, x, y, tol = sqrt(.Machine$double.eps), method = "Richardson", method.args = list(eps = 1e-04, d = 0.11, zero.tol = sqrt(.Machine$double.eps/7e-07), r = 6, v = 2, show.details = FALSE), side = NULL )
expr |
A given parametric model |
theta |
A vector of parameters of the model |
x |
A vector or matrix of observations of independent variable(s) |
y |
A vector of observations of response variable |
tol |
The tolerance for detecting linear dependencies in the columns of a matrix for calculating its inverse.
See the input argument of |
method |
It is the same as the input argument of |
method.args |
It is the same as the input argument of |
side |
It is the same as the input argument of |
The defined model should have two input arguments: a parameter vector and an independent variable vector or matrix,
e.g. myfun <- function(P, x){...}
, where P
represents the parameter vector and x
represents the independent variable vector or matrix.
Let be a measure of the skewness of the estimate of the i-th parameter. If
0.1,
the estimator
of parameter
is very close-to-linear in behavior;
if 0.1
0.25, the estimator is reasonably close-to-linear; if
0.25,
the skewness is very apparent; if
1, the estimator is considerably nonlinear in behavior (Pages 27-28 in Ratkowsky 1990).
skewness |
The skewness |
The current function can be applicable to nonlinear models with multiple independent variables.
Peijian Shi [email protected], Peter M. Ridland [email protected], David A. Ratkowsky [email protected], Yang Li [email protected].
Hougaard, P. (1985) The appropriateness of the asymptotic distribution in a nonlinear regression model in relation to curvature.
J. R. Statist. Soc., Ser. B 47, 103114.
Ratkowsky, D.A. (1990) Handbook of Nonlinear Regression Models, Marcel Dekker, New York.
derivIPEC
, hessian
in package numDeriv, jacobian
in package numDeriv
#### Example 1 ################################################################################# # The velocity of the reaction (counts/min^2) under different substrate concentrations # in parts per million (ppm) (Page 269 of Bates and Watts 1988) x1 <- c(0.02, 0.02, 0.06, 0.06, 0.11, 0.11, 0.22, 0.22, 0.56, 0.56, 1.10, 1.10) y1 <- c(76, 47, 97, 107, 123, 139, 159, 152, 191, 201, 207, 200) # Define the Michaelis-Menten (MM) model MM <- function(theta, x){ theta[1]*x / ( theta[2] + x ) } par1 <- c(212.68490865, 0.06412421) res5 <- skewIPEC( MM, theta=par1, x=x1, y=y1, tol= 1e-20 ) res5 ################################################################################################# #### Example 2 ################################################################################## # Development data of female pupae of cotton bollworm (Wu et al. 2009) # References: # Ratkowsky, D.A. and Reddy, G.V.P. (2017) Empirical model with excellent statistical # properties for describing temperature-dependent developmental rates of insects # and mites. Ann. Entomol. Soc. Am. 110, 302-309. # Wu, K., Gong, P. and Ruan, Y. (2009) Estimating developmental rates of # Helicoverpa armigera (Lepidoptera: Noctuidae) pupae at constant and # alternating temperature by nonlinear models. Acta Entomol. Sin. 52, 640-650. # 'x2' is the vector of temperature (in degrees Celsius) # 'D2' is the vector of developmental duration (in d) # 'y2' is the vector of the square root of developmental rate (in 1/d) x2 <- seq(15, 37, by=1) D2 <- c(41.24,37.16,32.47,26.22,22.71,19.01,16.79,15.63,14.27,12.48, 11.3,10.56,9.69,9.14,8.24,8.02,7.43,7.27,7.35,7.49,7.63,7.9,10.03) y2 <- 1/D2 y2 <- sqrt( y2 ) # Define the square root function of the Lobry-Rosso-Flandrois (LRF) model sqrt.LRF <- function(P, x){ ropt <- P[1] Topt <- P[2] Tmin <- P[3] Tmax <- P[4] fun0 <- function(z){ z[z < Tmin] <- Tmin z[z > Tmax] <- Tmax return(z) } x <- fun0(x) if (Tmin >= Tmax | ropt <= 0 | Topt <= Tmin | Topt >= Tmax) temp <- Inf if (Tmax > Tmin & ropt > 0 & Topt > Tmin & Topt < Tmax){ temp <- sqrt( ropt*(x-Tmax)*(x-Tmin)^2/((Topt-Tmin)*((Topt-Tmin )*(x-Topt)-(Topt-Tmax)*(Topt+Tmin-2*x))) ) } return( temp ) } myfun <- sqrt.LRF par2 <- c(0.1382926, 33.4575663, 5.5841244, 38.8282021) # To calculate bias resu5 <- skewIPEC( myfun, theta=par2, x=x2, y=y2, tol= 1e-20 ) resu5 ################################################################################################# #### Example 3 ################################################################################## # Weight of cut grass data (Pattinson 1981) # References: # Clarke, G.P.Y. (1987) Approximate confidence limits for a parameter function in nonlinear # regression. J. Am. Stat. Assoc. 82, 221-230. # Gebremariam, B. (2014) Is nonlinear regression throwing you a curve? # New diagnostic and inference tools in the NLIN Procedure. Paper SAS384-2014. # http://support.sas.com/resources/papers/proceedings14/SAS384-2014.pdf # Pattinson, N.B. (1981) Dry Matter Intake: An Estimate of the Animal # Response to Herbage on Offer. unpublished M.Sc. thesis, University # of Natal, Pietermaritzburg, South Africa, Department of Grassland Science. # 'x4' is the vector of weeks after commencement of grazing in a pasture # 'y4' is the vector of weight of cut grass from 10 randomly sited quadrants x4 <- 1:13 y4 <- c(3.183, 3.059, 2.871, 2.622, 2.541, 2.184, 2.110, 2.075, 2.018, 1.903, 1.770, 1.762, 1.550) # Define the first case of Mitscherlich equation MitA <- function(P1, x){ P1[3] + P1[2]*exp(P1[1]*x) } # Define the second case of Mitscherlich equation MitB <- function(P2, x){ log( P2[3] ) + exp(P2[2] + P2[1]*x) } # Define the third case of Mitscherlich equation MitC <- function(P3, x, x1=1, x2=13){ theta1 <- P3[1] beta2 <- P3[2] beta3 <- P3[3] theta2 <- (beta3 - beta2)/(exp(theta1*x2)-exp(theta1*x1)) theta3 <- beta2/(1-exp(theta1*(x1-x2))) - beta3/(exp(theta1*(x2-x1))-1) theta3 + theta2*exp(theta1*x) } ini.val3 <- c(-0.1, 2.5, 1) r0 <- fitIPEC( MitA, x=x4, y=y4, ini.val=ini.val3, xlim=NULL, ylim=NULL, fig.opt=TRUE, control=list(trace=FALSE, reltol=1e-20, maxit=50000) ) parA <- r0$par parA r5 <- skewIPEC(MitA, theta=parA, x=x4, y=y4, tol=1e-20) r5 ini.val4 <- c(exp(-0.1), log(2.5), 1) R0 <- fitIPEC( MitB, x=x4, y=y4, ini.val=ini.val3, xlim=NULL, ylim=NULL, fig.opt=TRUE, control=list(trace=FALSE, reltol=1e-20, maxit=50000) ) parB <- R0$par parB R5 <- skewIPEC( MitB, theta=parB, x=x4, y=y4, tol=1e-20 ) R5 ini.val6 <- c(-0.15, 2.52, 1.09) RES0 <- fitIPEC( MitC, x=x4, y=y4, ini.val=ini.val6, xlim=NULL, ylim=NULL, fig.opt=TRUE, control=list(trace=FALSE, reltol=1e-20, maxit=50000) ) parC <- RES0$par parC RES5 <- skewIPEC( MitC, theta=parC, x=x4, y=y4, tol=1e-20 ) RES5 ################################################################################################# #### Example 4 ################################################################################### # Data on biochemical oxygen demand (BOD; Marske 1967) # References # Pages 56, 255 and 271 in Bates and Watts (1988) # Carr, N.L. (1960) Kinetics of catalytic isomerization of n-pentane. Ind. Eng. Chem. # 52, 391-396. data(isom) Y <- isom[,1] X <- isom[,2:4] # There are three independent variables saved in matrix 'X' and one response variable (Y) # The first column of 'X' is the vector of partial pressure of hydrogen # The second column of 'X' is the vector of partial pressure of n-pentane # The third column of 'X' is the vector of partial pressure of isopentane # Y is the vector of experimental reaction rate (in 1/hr) isom.fun <- function(theta, x){ x1 <- x[,1] x2 <- x[,2] x3 <- x[,3] theta1 <- theta[1] theta2 <- theta[2] theta3 <- theta[3] theta4 <- theta[4] theta1*theta3*(x2-x3/1.632) / ( 1 + theta2*x1 + theta3*x2 + theta4*x3 ) } par8 <- c(35.92831619, 0.07084811, 0.03772270, 0.16718384) cons5 <- skewIPEC( isom.fun, theta=par8, x=X, y=Y, tol= 1e-20 ) cons5 #################################################################################################
#### Example 1 ################################################################################# # The velocity of the reaction (counts/min^2) under different substrate concentrations # in parts per million (ppm) (Page 269 of Bates and Watts 1988) x1 <- c(0.02, 0.02, 0.06, 0.06, 0.11, 0.11, 0.22, 0.22, 0.56, 0.56, 1.10, 1.10) y1 <- c(76, 47, 97, 107, 123, 139, 159, 152, 191, 201, 207, 200) # Define the Michaelis-Menten (MM) model MM <- function(theta, x){ theta[1]*x / ( theta[2] + x ) } par1 <- c(212.68490865, 0.06412421) res5 <- skewIPEC( MM, theta=par1, x=x1, y=y1, tol= 1e-20 ) res5 ################################################################################################# #### Example 2 ################################################################################## # Development data of female pupae of cotton bollworm (Wu et al. 2009) # References: # Ratkowsky, D.A. and Reddy, G.V.P. (2017) Empirical model with excellent statistical # properties for describing temperature-dependent developmental rates of insects # and mites. Ann. Entomol. Soc. Am. 110, 302-309. # Wu, K., Gong, P. and Ruan, Y. (2009) Estimating developmental rates of # Helicoverpa armigera (Lepidoptera: Noctuidae) pupae at constant and # alternating temperature by nonlinear models. Acta Entomol. Sin. 52, 640-650. # 'x2' is the vector of temperature (in degrees Celsius) # 'D2' is the vector of developmental duration (in d) # 'y2' is the vector of the square root of developmental rate (in 1/d) x2 <- seq(15, 37, by=1) D2 <- c(41.24,37.16,32.47,26.22,22.71,19.01,16.79,15.63,14.27,12.48, 11.3,10.56,9.69,9.14,8.24,8.02,7.43,7.27,7.35,7.49,7.63,7.9,10.03) y2 <- 1/D2 y2 <- sqrt( y2 ) # Define the square root function of the Lobry-Rosso-Flandrois (LRF) model sqrt.LRF <- function(P, x){ ropt <- P[1] Topt <- P[2] Tmin <- P[3] Tmax <- P[4] fun0 <- function(z){ z[z < Tmin] <- Tmin z[z > Tmax] <- Tmax return(z) } x <- fun0(x) if (Tmin >= Tmax | ropt <= 0 | Topt <= Tmin | Topt >= Tmax) temp <- Inf if (Tmax > Tmin & ropt > 0 & Topt > Tmin & Topt < Tmax){ temp <- sqrt( ropt*(x-Tmax)*(x-Tmin)^2/((Topt-Tmin)*((Topt-Tmin )*(x-Topt)-(Topt-Tmax)*(Topt+Tmin-2*x))) ) } return( temp ) } myfun <- sqrt.LRF par2 <- c(0.1382926, 33.4575663, 5.5841244, 38.8282021) # To calculate bias resu5 <- skewIPEC( myfun, theta=par2, x=x2, y=y2, tol= 1e-20 ) resu5 ################################################################################################# #### Example 3 ################################################################################## # Weight of cut grass data (Pattinson 1981) # References: # Clarke, G.P.Y. (1987) Approximate confidence limits for a parameter function in nonlinear # regression. J. Am. Stat. Assoc. 82, 221-230. # Gebremariam, B. (2014) Is nonlinear regression throwing you a curve? # New diagnostic and inference tools in the NLIN Procedure. Paper SAS384-2014. # http://support.sas.com/resources/papers/proceedings14/SAS384-2014.pdf # Pattinson, N.B. (1981) Dry Matter Intake: An Estimate of the Animal # Response to Herbage on Offer. unpublished M.Sc. thesis, University # of Natal, Pietermaritzburg, South Africa, Department of Grassland Science. # 'x4' is the vector of weeks after commencement of grazing in a pasture # 'y4' is the vector of weight of cut grass from 10 randomly sited quadrants x4 <- 1:13 y4 <- c(3.183, 3.059, 2.871, 2.622, 2.541, 2.184, 2.110, 2.075, 2.018, 1.903, 1.770, 1.762, 1.550) # Define the first case of Mitscherlich equation MitA <- function(P1, x){ P1[3] + P1[2]*exp(P1[1]*x) } # Define the second case of Mitscherlich equation MitB <- function(P2, x){ log( P2[3] ) + exp(P2[2] + P2[1]*x) } # Define the third case of Mitscherlich equation MitC <- function(P3, x, x1=1, x2=13){ theta1 <- P3[1] beta2 <- P3[2] beta3 <- P3[3] theta2 <- (beta3 - beta2)/(exp(theta1*x2)-exp(theta1*x1)) theta3 <- beta2/(1-exp(theta1*(x1-x2))) - beta3/(exp(theta1*(x2-x1))-1) theta3 + theta2*exp(theta1*x) } ini.val3 <- c(-0.1, 2.5, 1) r0 <- fitIPEC( MitA, x=x4, y=y4, ini.val=ini.val3, xlim=NULL, ylim=NULL, fig.opt=TRUE, control=list(trace=FALSE, reltol=1e-20, maxit=50000) ) parA <- r0$par parA r5 <- skewIPEC(MitA, theta=parA, x=x4, y=y4, tol=1e-20) r5 ini.val4 <- c(exp(-0.1), log(2.5), 1) R0 <- fitIPEC( MitB, x=x4, y=y4, ini.val=ini.val3, xlim=NULL, ylim=NULL, fig.opt=TRUE, control=list(trace=FALSE, reltol=1e-20, maxit=50000) ) parB <- R0$par parB R5 <- skewIPEC( MitB, theta=parB, x=x4, y=y4, tol=1e-20 ) R5 ini.val6 <- c(-0.15, 2.52, 1.09) RES0 <- fitIPEC( MitC, x=x4, y=y4, ini.val=ini.val6, xlim=NULL, ylim=NULL, fig.opt=TRUE, control=list(trace=FALSE, reltol=1e-20, maxit=50000) ) parC <- RES0$par parC RES5 <- skewIPEC( MitC, theta=parC, x=x4, y=y4, tol=1e-20 ) RES5 ################################################################################################# #### Example 4 ################################################################################### # Data on biochemical oxygen demand (BOD; Marske 1967) # References # Pages 56, 255 and 271 in Bates and Watts (1988) # Carr, N.L. (1960) Kinetics of catalytic isomerization of n-pentane. Ind. Eng. Chem. # 52, 391-396. data(isom) Y <- isom[,1] X <- isom[,2:4] # There are three independent variables saved in matrix 'X' and one response variable (Y) # The first column of 'X' is the vector of partial pressure of hydrogen # The second column of 'X' is the vector of partial pressure of n-pentane # The third column of 'X' is the vector of partial pressure of isopentane # Y is the vector of experimental reaction rate (in 1/hr) isom.fun <- function(theta, x){ x1 <- x[,1] x2 <- x[,2] x3 <- x[,3] theta1 <- theta[1] theta2 <- theta[2] theta3 <- theta[3] theta4 <- theta[4] theta1*theta3*(x2-x3/1.632) / ( 1 + theta2*x1 + theta3*x2 + theta4*x3 ) } par8 <- c(35.92831619, 0.07084811, 0.03772270, 0.16718384) cons5 <- skewIPEC( isom.fun, theta=par8, x=X, y=Y, tol= 1e-20 ) cons5 #################################################################################################