Title: | Multivariate Probit Models |
---|---|
Description: | Tools for estimating multivariate probit models, calculating conditional and unconditional expectations, and calculating marginal effects on conditional and unconditional expectations. |
Authors: | Arne Henningsen <[email protected]> |
Maintainer: | Arne Henningsen <[email protected]> |
License: | GPL (>= 2) |
Version: | 0.1-10 |
Built: | 2024-11-12 03:39:53 UTC |
Source: | https://github.com/cran/mvProbit |
Estimating multivariate probit models by the maximum likelihood method.
WARNING: this function is experimental and extremely (perhaps even unusably) slow!
mvProbit( formula, data, start = NULL, startSigma = NULL, method = "BHHH", finalHessian = "BHHH", algorithm = "GHK", nGHK = 1000, intGrad = TRUE, oneSidedGrad = FALSE, eps = 1e-6, random.seed = 123, ... ) ## S3 method for class 'mvProbit' print( x, digits = 4, ... )
mvProbit( formula, data, start = NULL, startSigma = NULL, method = "BHHH", finalHessian = "BHHH", algorithm = "GHK", nGHK = 1000, intGrad = TRUE, oneSidedGrad = FALSE, eps = 1e-6, random.seed = 123, ... ) ## S3 method for class 'mvProbit' print( x, digits = 4, ... )
formula |
a |
data |
a |
start |
an optional numeric vector specifying the starting values
for the model coefficients;
if argument |
startSigma |
optional starting values for the covariance/correlation matrix
of the residuals (must be symmetric and have ones on its diagonal);
if this argument is not specified
and the starting values for the correlation coefficients
are not included in argument |
method |
maximisation method / algorithm
(see |
finalHessian |
Calculation of the final Hessian:
either |
algorithm |
algorithm for computing integrals
of the multivariate normal distribution,
either function |
nGHK |
numeric value specifying the number of simulation draws of the GHK algorithm for computing integrals of the multivariate normal distribution. |
intGrad |
logical. If |
oneSidedGrad |
logical. If this argument
and argument |
eps |
numeric. The step size for the one-sided numeric finit-distance differentiation. Unfortunately, it is currently not possible to set the step size for the two-sided numeric finit-distance differentiation. |
random.seed |
an integer used to seed R's random number generator;
this is to ensure replicability
when computing (cumulative) probabilities of the multivariate normal distribution
which is required to calculate the log likelihood values;
|
x |
object of class |
digits |
positive integer specifiying the minimum number of
significant digits to be printed
(see |
... |
additional arguments to |
It is possible to specify starting values
(a) both for the model coefficients and the correlation coefficients
(using argument start
alone or arguments start
and startSigma
together),
(b) only for the model coefficients (using argument start
alone), or
(c) only for the correlation coefficients (using argument startSigma
alone).
If the model has dependent variables (equations)
and
explanatory variables in each equation,
the order of the starting values in argument
start
must be as follows:
, ...,
,
, ...,
, ...,
, ...,
,
where
is the coefficient
of the
th explanatory variable in the
th equation.
If argument
startSigma
is not specified,
argument start
can additionally include following elements:
,
,
, ...,
,
,
, ...,
, ...,
,
where
is the correlation coefficient corresponding to
the
th and
th equation.
The ‘state’ (or ‘seed’) of R's random number generator
is saved at the beginning of the mvProbit
function
and restored at the end of this function
so that this function does not affect the generation
of random numbers outside this function
although the random seed is set to argument random.seed
and the calculation of the (cumulative) multivariate normal distribution
uses random numbers.
mvProbit
returns an object of class "mvProbit"
inheriting from class "maxLik"
.
The returned object contains the same components as objects
returned by maxLik
and additionally
the following components:
call |
the matched call. |
start |
the vector of starting values. |
nDep |
the number of dependent variables. |
nReg |
the number of explanatory variables (regressors). |
nObs |
the number of observations. |
dummyVars |
vector of character strings
indicating the names of explanatory variables
that contain only zeros and ones or only |
Arne Henningsen
Greene, W.H. (1996): Marginal Effects in the Bivariate Probit Model, NYU Working Paper No. EC-96-11. Available at https://www.ssrn.com/abstract=1293106.
mvProbitLogLik
,
mvProbitMargEff
,
probit
,
glm
## generate a simulated data set set.seed( 123 ) # number of observations nObs <- 50 # generate explanatory variables xMat <- cbind( const = rep( 1, nObs ), x1 = as.numeric( rnorm( nObs ) > 0 ), x2 = rnorm( nObs ) ) # model coefficients beta <- cbind( c( 0.8, 1.2, -0.8 ), c( -0.6, 1.0, -1.6 ), c( 0.5, -0.6, 1.2 ) ) # covariance matrix of error terms library( miscTools ) sigma <- symMatrix( c( 1, 0.2, 0.4, 1, -0.1, 1 ) ) # generate dependent variables yMatLin <- xMat %*% beta yMat <- ( yMatLin + rmvnorm( nObs, sigma = sigma ) ) > 0 colnames( yMat ) <- paste( "y", 1:3, sep = "" ) # estimation (BHHH optimizer and GHK algorithm) estResult <- mvProbit( cbind( y1, y2, y3 ) ~ x1 + x2, data = as.data.frame( cbind( xMat, yMat ) ), iterlim = 1, nGHK = 50 ) summary( estResult ) # same estimation with user-defined starting values estResultStart <- mvProbit( cbind( y1, y2, y3 ) ~ x1 + x2, start = c( beta ), startSigma = sigma, data = as.data.frame( cbind( xMat, yMat ) ), iterlim = 1, nGHK = 50 ) summary( estResultStart )
## generate a simulated data set set.seed( 123 ) # number of observations nObs <- 50 # generate explanatory variables xMat <- cbind( const = rep( 1, nObs ), x1 = as.numeric( rnorm( nObs ) > 0 ), x2 = rnorm( nObs ) ) # model coefficients beta <- cbind( c( 0.8, 1.2, -0.8 ), c( -0.6, 1.0, -1.6 ), c( 0.5, -0.6, 1.2 ) ) # covariance matrix of error terms library( miscTools ) sigma <- symMatrix( c( 1, 0.2, 0.4, 1, -0.1, 1 ) ) # generate dependent variables yMatLin <- xMat %*% beta yMat <- ( yMatLin + rmvnorm( nObs, sigma = sigma ) ) > 0 colnames( yMat ) <- paste( "y", 1:3, sep = "" ) # estimation (BHHH optimizer and GHK algorithm) estResult <- mvProbit( cbind( y1, y2, y3 ) ~ x1 + x2, data = as.data.frame( cbind( xMat, yMat ) ), iterlim = 1, nGHK = 50 ) summary( estResult ) # same estimation with user-defined starting values estResultStart <- mvProbit( cbind( y1, y2, y3 ) ~ x1 + x2, start = c( beta ), startSigma = sigma, data = as.data.frame( cbind( xMat, yMat ) ), iterlim = 1, nGHK = 50 ) summary( estResultStart )
Function mvProbitLogLik
calculates log likelihood values
of multivariate probit models.
The logLik
model returns or calculates log likelihood values
of multivariate probit models estimated by mvProbit
.
mvProbitLogLik( formula, coef, sigma = NULL, data, algorithm = "GHK", nGHK = 1000, returnGrad = oneSidedGrad, oneSidedGrad = FALSE, eps = 1e-6, random.seed = 123, ... ) ## S3 method for class 'mvProbit' logLik( object, coef = NULL, data = NULL, algorithm = NULL, nGHK = NULL, random.seed = NULL, ... )
mvProbitLogLik( formula, coef, sigma = NULL, data, algorithm = "GHK", nGHK = 1000, returnGrad = oneSidedGrad, oneSidedGrad = FALSE, eps = 1e-6, random.seed = 123, ... ) ## S3 method for class 'mvProbit' logLik( object, coef = NULL, data = NULL, algorithm = NULL, nGHK = NULL, random.seed = NULL, ... )
formula |
a |
coef |
a numeric vector of the model coefficients;
if argument |
sigma |
optional argument for specifying
the covariance/correlation matrix of the residuals
(must be symmetric and have ones on its diagonal);
if this argument is not specified,
the correlation coefficients must be specified by argument |
data |
a |
algorithm |
algorithm for computing integrals
of the multivariate normal distribution,
either function |
nGHK |
numeric value specifying the number of simulation draws of the GHK algorithm for computing integrals of the multivariate normal distribution. |
returnGrad |
logical. If |
oneSidedGrad |
logical. If |
eps |
numeric. The step size for the numeric finite-distance differentiation. |
random.seed |
an integer used to seed R's random number generator;
this is to ensure replicability
when computing (cumulative) probabilities of the multivariate normal distribution
which is required to calculate the log likelihood values;
|
object |
an object of class |
... |
additional arguments are passed
to |
If the logLik
method is called with object
as the only argument,
it returns the log-likelihood value
found in the maximum likelihood estimation.
If any other argument is not NULL
,
the logLik
method calculates the log-likelihood value
by calling mvProbitLogLik
.
All arguments that are NULL
,
are taken from argument object
.
If the model has dependent variables (equations)
and
explanatory variables in each equation,
the order of the model coefficients in argument
coef
must be as follows:
, ...,
,
, ...,
, ...,
, ...,
,
where
is the coefficient
of the
th explanatory variable in the
th equation.
If argument
sigma
is not specified,
argument coef
must additionally include following elements:
,
,
, ...,
,
,
, ...,
, ...,
,
where
is the correlation coefficient corresponding to
the
th and
th equation.
The ‘state’ (or ‘seed’) of R's random number generator
is saved at the beginning of the mvProbitLogLik
function
and restored at the end of this function
so that this function does not affect the generation
of random numbers outside this function
although the random seed is set to argument random.seed
and the calculation of the (cumulative) multivariate normal distribution
uses random numbers.
mvProbitLogLik
returns a vector
containing the log likelihood values for each observation.
If argument returnGrad
is TRUE
,
the vector returned by mvProbitLogLik
has an attribute "gradient"
,
which is a matrix and provides
the gradients of the log-likelihood function
with respect to all parameters
(coef
and upper triangle of sigma
)
evaluated at each observation
and obtained by numeric finite-difference differentiation.
The logLik
method returns the total log likelihood value
(sum over all observations)
with attribute df
equal to the number of estimated parameters
(model coefficients and correlation coefficients).
Arne Henningsen
Greene, W.H. (1996): Marginal Effects in the Bivariate Probit Model, NYU Working Paper No. EC-96-11. Available at https://www.ssrn.com/abstract=1293106.
mvProbit
,
mvProbitMargEff
,
probit
,
glm
## generate a simulated data set set.seed( 123 ) # number of observations nObs <- 10 # generate explanatory variables xMat <- cbind( const = rep( 1, nObs ), x1 = as.numeric( rnorm( nObs ) > 0 ), x2 = as.numeric( rnorm( nObs ) > 0 ), x3 = rnorm( nObs ), x4 = rnorm( nObs ) ) # model coefficients beta <- cbind( c( 0.8, 1.2, -1.0, 1.4, -0.8 ), c( -0.6, 1.0, 0.6, -1.2, -1.6 ), c( 0.5, -0.6, -0.7, 1.1, 1.2 ) ) # covariance matrix of error terms library( miscTools ) sigma <- symMatrix( c( 1, 0.2, 0.4, 1, -0.1, 1 ) ) # generate dependent variables yMatLin <- xMat %*% beta yMat <- ( yMatLin + rmvnorm( nObs, sigma = sigma ) ) > 0 colnames( yMat ) <- paste( "y", 1:3, sep = "" ) # log likelihood values myData <- as.data.frame( cbind( xMat, yMat ) ) logLikVal <- mvProbitLogLik( cbind( y1, y2, y3 ) ~ x1 + x2 + x3 + x4, coef = c( beta ), sigma = sigma, data = myData ) print( logLikVal )
## generate a simulated data set set.seed( 123 ) # number of observations nObs <- 10 # generate explanatory variables xMat <- cbind( const = rep( 1, nObs ), x1 = as.numeric( rnorm( nObs ) > 0 ), x2 = as.numeric( rnorm( nObs ) > 0 ), x3 = rnorm( nObs ), x4 = rnorm( nObs ) ) # model coefficients beta <- cbind( c( 0.8, 1.2, -1.0, 1.4, -0.8 ), c( -0.6, 1.0, 0.6, -1.2, -1.6 ), c( 0.5, -0.6, -0.7, 1.1, 1.2 ) ) # covariance matrix of error terms library( miscTools ) sigma <- symMatrix( c( 1, 0.2, 0.4, 1, -0.1, 1 ) ) # generate dependent variables yMatLin <- xMat %*% beta yMat <- ( yMatLin + rmvnorm( nObs, sigma = sigma ) ) > 0 colnames( yMat ) <- paste( "y", 1:3, sep = "" ) # log likelihood values myData <- as.data.frame( cbind( xMat, yMat ) ) logLikVal <- mvProbitLogLik( cbind( y1, y2, y3 ) ~ x1 + x2 + x3 + x4, coef = c( beta ), sigma = sigma, data = myData ) print( logLikVal )
mvProbitExp
calculates expected outcomes
from multivariate probit models.
mvProbitMargEff
calculates marginal effects of the explanatory variables
on expected outcomes from multivariate probit models.
The margEff
method for objects of class "mvProbit"
is a wrapper function
that (for the convenience of the user)
extracts the relevant information from the estimation results
and then calls mvProbitMargEff
.
mvProbitExp( formula, coef, sigma = NULL, data, cond = FALSE, algorithm = "GHK", nGHK = 1000, random.seed = 123, ... ) mvProbitMargEff( formula, coef, sigma = NULL, vcov = NULL, data, cond = FALSE, algorithm = "GHK", nGHK = 1000, eps = 1e-06, dummyVars = NA, addMean = FALSE, returnJacobian = FALSE, random.seed = 123, ... ) ## S3 method for class 'mvProbit' margEff( object, data = eval( object$call$data ), cond = FALSE, othDepVar = NULL, dummyVars = object$dummyVars, atMean = FALSE, calcVCov = FALSE, ... )
mvProbitExp( formula, coef, sigma = NULL, data, cond = FALSE, algorithm = "GHK", nGHK = 1000, random.seed = 123, ... ) mvProbitMargEff( formula, coef, sigma = NULL, vcov = NULL, data, cond = FALSE, algorithm = "GHK", nGHK = 1000, eps = 1e-06, dummyVars = NA, addMean = FALSE, returnJacobian = FALSE, random.seed = 123, ... ) ## S3 method for class 'mvProbit' margEff( object, data = eval( object$call$data ), cond = FALSE, othDepVar = NULL, dummyVars = object$dummyVars, atMean = FALSE, calcVCov = FALSE, ... )
formula |
a one-sided or two-sided |
coef |
a numeric vector of the model coefficients;
if argument |
sigma |
optional argument for specifying
the covariance/correlation matrix of the residuals
(must be symmetric and have ones on its diagonal);
if this argument is not specified,
the correlation coefficients must be specified by argument |
vcov |
an optional symmetric matrix specifying the variance-covariance matrix of all coefficients (model coefficients and correlation coefficients); if this argument is specified, the approximate variance covariance matrices of the marginal effects are calculated and returned as an attribute (see below). |
data |
a |
cond |
logical value indicating
whether (marginal effects on) conditional expectations (if |
algorithm |
algorithm for computing integrals
of the multivariate normal distribution,
either function |
nGHK |
numeric value specifying the number of simulation draws of the GHK algorithm for computing integrals of the multivariate normal distribution. |
eps |
numeric, the difference between the two values of each (numerical) explanatory variable that is used for the numerical differentiation. |
dummyVars |
optional vector containing the names (character strings)
of explanatory variables
that should be treated as dummy variables (see section ‘Details’).
If |
addMean |
logical.
If |
returnJacobian |
logical.
If |
random.seed |
an integer used to seed R's random number generator;
this is to ensure replicability
when computing (cumulative) probabilities of the multivariate normal distribution
which is required to calculate the conditional expectations;
|
object |
an object of class |
othDepVar |
optional scalar or vector for specifying
the values of the (other) dependent variables
when calculating the marginal effects on the conditional expectations.
If this argument is a scalar (zero or one),
it is assumed that all (other) dependent variables have this value
at all observations.
If this argument is a vector (filled with zeros or ones)
with length equal to the number of dependent variables,
it is assumed that the vector of dependent variables has these values
at all observations.
If this argument is |
atMean |
logical.
If |
calcVCov |
logical.
If |
... |
additional arguments to |
When calculating (marginal effects on) unconditional expectations,
the left-hand side of argument formula
is ignored.
When calculating (marginal effects on) conditional expectations
and argument formula
is a one-sided formula
(i.e. only the right-hand side is specified)
or argument othDepOne
is TRUE
,
(the marginal effects on) the conditional expectations
are calculated based on the assumption
that all other dependent variables are one.
The computation of the marginal effects
of dummy variables
(i.e. variables specified in argument dummyVars
)
ignores argument eps
and evaluates the effect of increasing these variables from zero to one.
The marginal effects of (continuous) variables
(i.e. variables not specified in argument dummyVars
)
are calculated by evaluating the effect
of increasing these variables from their actual values minus 0.5 * eps
to their actual values plus 0.5 * eps
(divided by eps
).
If the model has dependent variables (equations)
and
explanatory variables in each equation,
the order of the model coefficients in argument
coef
must be as follows:
, ...,
,
, ...,
, ...,
, ...,
,
where
is the coefficient
of the
th explanatory variable in the
th equation.
If argument
sigma
is not specified,
argument coef
must additionally include following elements:
,
,
, ...,
,
,
, ...,
, ...,
,
where
is the correlation coefficient corresponding to
the
th and
th equation.
If argument vcov
of function mvProbitMargEff
is specified
or argument calcVCov
of the margEff
method is TRUE
,
the approximate variance covariance matrices of the marginal effects
are calculated at each observation by using the ‘delta method’,
where the jacobian matrix of the marginal effects
with respect to the coefficients is obtained by numerical differentiation.
The ‘state’ (or ‘seed’) of R's random number generator
is saved at the beginning of the call to these functions
and restored at the end
so that these functions do not affect the generation
of random numbers outside this function
although the random seed is set to argument random.seed
and the calculation of the (cumulative) multivariate normal distribution
uses random numbers.
mvProbitExp
returns a data frame
containing the expectations of the dependent variables.
mvProbitMargEff
and the margEff
method return a data frame
containing the marginal effects of the explanatory variables
on the expectations of the dependent variables.
If argument vcov
of function mvProbitMargEff
is specified
or argument calcVCov
of the margEff
method is TRUE
,
the returned data frame has an attribute vcov
,
which is a three-dimensional array,
where the first dimension corresponds to the observation
and the latter two dimensions span the approximate variance covariance matrix
of the marginal effects calculated for each observation.
If argument returnJacobian
of function mvProbitMargEff
or method margEff
is set to TRUE
,
the returned data frame has an attribute jacobian
,
which is a three-dimensional array
that contains the Jacobian matrices of the marginal effects
with respect to the coefficients at each observation,
where the first dimension corresponds to the observations,
the second dimension corresponds to the marginal effects,
and the third dimension corresponds to the coefficients.
Arne Henningsen
Greene, W.H. (1996): Marginal Effects in the Bivariate Probit Model, NYU Working Paper No. EC-96-11. Available at https://www.ssrn.com/abstract=1293106.
mvProbit
,
mvProbitLogLik
,
probit
,
glm
## generate a simulated data set set.seed( 123 ) # number of observations nObs <- 10 # generate explanatory variables xData <- data.frame( const = rep( 1, nObs ), x1 = as.numeric( rnorm( nObs ) > 0 ), x2 = as.numeric( rnorm( nObs ) > 0 ), x3 = rnorm( nObs ), x4 = rnorm( nObs ) ) # model coefficients beta <- c( 0.8, 1.2, -1.0, 1.4, -0.8, -0.6, 1.0, 0.6, -1.2, -1.6, 0.5, -0.6, -0.7, 1.1, 1.2 ) # covariance matrix of error terms library( miscTools ) sigma <- symMatrix( c( 1, 0.2, 0.4, 1, -0.1, 1 ) ) # unconditional expectations of dependent variables yExp <- mvProbitExp( ~ x1 + x2 + x3 + x4, coef = c( beta ), sigma = sigma, data = xData ) print( yExp ) # marginal effects on unconditional expectations of dependent variables margEffUnc <- mvProbitMargEff( ~ x1 + x2 + x3 + x4, coef = c( beta ), sigma = sigma, data = xData ) print( margEffUnc ) # conditional expectations of dependent variables # (assuming that all other dependent variables are one) yExpCond <- mvProbitExp( ~ x1 + x2 + x3 + x4, coef = beta, sigma = sigma, data = xData, cond = TRUE ) print( yExpCond ) # marginal effects on conditional expectations of dependent variables # (assuming that all other dependent variables are one) margEffCond <- mvProbitMargEff( ~ x1 + x2 + x3 + x4, coef = beta, sigma = sigma, data = xData, cond = TRUE ) print( margEffCond ) # conditional expectations of dependent variables # (assuming that all other dependent variables are zero) xData$y1 <- 0 xData$y2 <- 0 xData$y3 <- 0 yExpCond0 <- mvProbitExp( cbind( y1, y2, y3 ) ~ x1 + x2 + x3 + x4, coef = beta, sigma = sigma, data = xData, cond = TRUE ) print( yExpCond0 ) # marginal effects on conditional expectations of dependent variables # (assuming that all other dependent variables are zero) margEffCond0 <- mvProbitMargEff( cbind( y1, y2, y3 ) ~ x1 + x2 + x3 + x4, coef = beta, sigma = sigma, data = xData, cond = TRUE ) print( margEffCond0 )
## generate a simulated data set set.seed( 123 ) # number of observations nObs <- 10 # generate explanatory variables xData <- data.frame( const = rep( 1, nObs ), x1 = as.numeric( rnorm( nObs ) > 0 ), x2 = as.numeric( rnorm( nObs ) > 0 ), x3 = rnorm( nObs ), x4 = rnorm( nObs ) ) # model coefficients beta <- c( 0.8, 1.2, -1.0, 1.4, -0.8, -0.6, 1.0, 0.6, -1.2, -1.6, 0.5, -0.6, -0.7, 1.1, 1.2 ) # covariance matrix of error terms library( miscTools ) sigma <- symMatrix( c( 1, 0.2, 0.4, 1, -0.1, 1 ) ) # unconditional expectations of dependent variables yExp <- mvProbitExp( ~ x1 + x2 + x3 + x4, coef = c( beta ), sigma = sigma, data = xData ) print( yExp ) # marginal effects on unconditional expectations of dependent variables margEffUnc <- mvProbitMargEff( ~ x1 + x2 + x3 + x4, coef = c( beta ), sigma = sigma, data = xData ) print( margEffUnc ) # conditional expectations of dependent variables # (assuming that all other dependent variables are one) yExpCond <- mvProbitExp( ~ x1 + x2 + x3 + x4, coef = beta, sigma = sigma, data = xData, cond = TRUE ) print( yExpCond ) # marginal effects on conditional expectations of dependent variables # (assuming that all other dependent variables are one) margEffCond <- mvProbitMargEff( ~ x1 + x2 + x3 + x4, coef = beta, sigma = sigma, data = xData, cond = TRUE ) print( margEffCond ) # conditional expectations of dependent variables # (assuming that all other dependent variables are zero) xData$y1 <- 0 xData$y2 <- 0 xData$y3 <- 0 yExpCond0 <- mvProbitExp( cbind( y1, y2, y3 ) ~ x1 + x2 + x3 + x4, coef = beta, sigma = sigma, data = xData, cond = TRUE ) print( yExpCond0 ) # marginal effects on conditional expectations of dependent variables # (assuming that all other dependent variables are zero) margEffCond0 <- mvProbitMargEff( cbind( y1, y2, y3 ) ~ x1 + x2 + x3 + x4, coef = beta, sigma = sigma, data = xData, cond = TRUE ) print( margEffCond0 )
These methods prepare and print summary results for multivariate probit models.
## S3 method for class 'mvProbit' summary( object, ... ) ## S3 method for class 'summary.mvProbit' print( x, digits = 4, ... )
## S3 method for class 'mvProbit' summary( object, ... ) ## S3 method for class 'summary.mvProbit' print( x, digits = 4, ... )
object |
object of class |
x |
object of class |
digits |
positive integer specifiying the minimum number of
significant digits to be printed
(passed to |
... |
currently not used. |
summary.mvProbit
returns an object of class "summary.mvProbit"
inheriting from class "summary.maxLik"
.
The returned object contains the same components as objects
returned by summary.maxLik
and additionally
the following components:
call |
the matched call. |
start |
the vector of starting values. |
nDep |
the number of dependent variables. |
nReg |
the number of explanatory variables (regressors). |
nObs |
the number of observations. |
Arne Henningsen
These methods prepare and print a statistical summary of marginal effects of multivariate probit models.
## S3 method for class 'mvProbitMargEff' summary( object, ... ) ## S3 method for class 'summary.mvProbitMargEff' print( x, digits = 4, ... )
## S3 method for class 'mvProbitMargEff' summary( object, ... ) ## S3 method for class 'summary.mvProbitMargEff' print( x, digits = 4, ... )
object |
object of class |
x |
object of class |
digits |
positive integer specifiying the minimum number of
significant digits to be printed
(passed to |
... |
currently not used. |
summary.mvProbitMargEff
returns an object
of class "summary.mvProbitMargEff"
inheriting from class "matrix"
.
The returned object is a matrix with four columns,
where the marginal effects are in the first column,
their standard errors are in the second column,
corresponding ‘z values’ are in the third column,
and the resulting ‘P values’ are in the last column.
Arne Henningsen
mvProbitMargEff
,
margEff.mvProbit
,
mvProbit
.