WOLFRAM

Enable JavaScript to interact with content and submit forms on Wolfram websites. Learn how
Wolfram Language & System Documentation Center

LinearModelFit [{{x1,y1},{x2,y2},},{f1,f2,},x]

constructs a linear model of the form that fits the yi for successive xi values.

LinearModelFit [data,{f1,f2,},{x1,x2,}]

constructs a linear model where the fi depend on the variables xk.

LinearModelFit [{m,v}]

constructs a linear model from the design matrix m and response vector v.

Details and Options
Details and Options Details and Options
Examples  
Basic Examples  
Scope  
Data  
Model  
Properties  
Data & Fitted Functions  
Residuals  
Sums of Squares  
Parameter Estimation Diagnostics  
Influence Measures  
Prediction Values  
Goodness-of-Fit Measures  
Generalizations & Extensions  
Options  
ConfidenceLevel  
IncludeConstantBasis  
LinearOffsetFunction  
Show More Show More
NominalVariables  
VarianceEstimatorFunction  
Weights  
WorkingPrecision  
Applications  
Properties & Relations  
See Also
Tech Notes
Related Guides
History
Cite this Page

LinearModelFit

LinearModelFit [{{x1,y1},{x2,y2},},{f1,f2,},x]

constructs a linear model of the form that fits the yi for successive xi values.

LinearModelFit [data,{f1,f2,},{x1,x2,}]

constructs a linear model where the fi depend on the variables xk.

LinearModelFit [{m,v}]

constructs a linear model from the design matrix m and response vector v.

Details and Options

  • LinearModelFit attempts to model the input data using a linear combination of functions.
  • LinearModelFit produces a linear model of the form under the assumption that the original are independent normally distributed with mean and common standard deviation.
  • LinearModelFit returns a symbolic FittedModel object to represent the linear model it constructs.
  • The value of the best-fit function from LinearModelFit at a particular point x1, can be found from model[x1,].
  • Data
  • Possible forms of data are:
  • {y1,y2,} equivalent to the form {{1,y1},{2,y2},}
    {{x11,x12,,y1},} a list of independent values xij and the responses yi
    {{x11,x12,}y1,} a list of rules between input values and response
    {{x11,x12,},}{y1,y2,} a rule between a list of input values and responses
    {{x11,,y1,},}n fit the n^(th) column of a matrix
    Tabular []name fit the column name in a tabular object
  • With multivariate data such as {{x_(11),x_(12),... ,y_(1)},{x_(21),x_(22),... ,y_(2)},...}, the number of coordinates xi1, xi2, should equal the number of variables xi.
  • The data points can be approximate real numbers. Uncertainty can be specified using Around .
  • Additionally, data can be specified using a design matrix without specifying functions and variables:
  • {m,v} a design matrix m and response vector v
  • In LinearModelFit [{m,v }], the design matrix m is formed from the values of basis functions fi at data points in the form {{f1,f2,},{f1,f2,},}. The response vector v is the list of responses {y1,y2,}.
  • When a design matrix is used, the basis functions fi can be specified using the form LinearModelFit [{m,v},{f1,f2,}].
  • For a design matrix m and response vector v, the model is , where is the vector of parameters to be estimated.
  • Options
  • LinearModelFit takes the following options:
  • ConfidenceLevel 95/100 confidence level to use for parameters and predictions
    IncludeConstantBasis True whether to include a constant basis function
    LinearOffsetFunction None known offset in the linear predictor
    NominalVariables None variables considered as nominal or categorical
    VarianceEstimatorFunction Automatic function for estimating the error variance
    Weights Automatic weights for data elements
    WorkingPrecision Automatic precision used in internal computations
  • With the setting IncludeConstantBasis->False , a model of the form is fitted. The option IncludeConstantBasis is ignored if the design matrix is specified in the input.
  • With the setting LinearOffsetFunction->h, a model of the form is fitted.
  • With ConfidenceLevel->p, probability-p confidence intervals are computed for parameter and prediction intervals.
  • With the setting Weights->{w1,w2,}, the error variance for yi is assumed proportional to .
  • With the setting Weights->Automatic , the weights will be set to 1 if the data contains exact values. If the data contains Around values, the weights will be set to with the total response variance.
  • The total response variance is a function of the initial response variance si2 and the independent values variance .
  • The are propagated through the model using AroundReplace and the resulting variance is added to response variance si2. The function FindRoot is used internally to find a self-consistent solution according to the Fasano and Vio method.
  • With the setting VarianceEstimatorFunction->f, the variance is estimated by f[res,w], where res={y1-,y2-,} is the list of residuals and w={w1,w2,} is the list of weights for the measurements yi.
  • Using VarianceEstimatorFunction->(1&) and Weights->{1/Δy12,1/Δy22,}, Δyi is treated as the known uncertainty of measurement yi, and parameter standard errors are effectively computed only from the weights.
  • Properties
  • The properties and diagnostics of the FittedModel can be obtained from model["property"].
  • Properties related to data and the fitted function obtained using model["property"] include:
  • "BasisFunctions" list of basis functions
    "BestFit" fitted function
    "BestFitAround" fitted function and mean uncertainty
    "BestFitDataAround" fitted function and data uncertainty
    "BestFitParameters" parameter estimates
    "Data" the input data or design matrix and response vector
    "DesignMatrix" design matrix for the model
    "Function" best fit pure function
    "Response" response values in the input data
    "Weights" weights used to fit the data
  • Types of residuals include:
  • "FitResiduals" difference between actual and predicted responses
    "StandardizedResiduals" fit residuals divided by the standard error for each residual
    "StudentizedResiduals" fit residuals divided by single deletion error estimates
  • Properties related to the sum of squared errors include:
  • "ANOVA" analysis of variance data
    "CoefficientOfVariation" estimated standard deviation divided by the response mean
    "EstimatedVariance" estimate of the error variance
    "PartialSumOfSquares" changes in model sum of squares as nonconstant basis functions are removed
    "SequentialSumOfSquares" the model sum of squares partitioned componentwise
  • Properties and diagnostics for parameter estimates include:
  • "CorrelationMatrix" parameter correlation matrix
    "CovarianceMatrix" parameter covariance matrix
    "Eigenstructure" eigenstructure of the parameter correlation matrix
    "ParameterEstimates" table of fitted parameter information
    "VarianceInflationFactors" list of inflation factors for the estimated parameters
  • Properties related to influence measures include:
  • "BetaDifferences" DFBETAS measures of influence on parameter values
    "CatcherMatrix" catcher matrix
    "CookDistances" list of Cook distances
    "CovarianceRatios" COVRATIO measures of observation influence
    "DurbinWatsonD" DurbinWatson statistic for autocorrelation
    "FitDifferences" DFFITS measures of influence on predicted values
    "FVarianceRatios" FVARATIO measures of observation influence
    "HatDiagonal" diagonal elements of the hat matrix
    "SingleDeletionVariances" list of variance estimates with the ^(th) data point omitted
  • Properties of predicted values include:
  • "MeanPredictionBands" confidence bands for mean predictions
    "MeanPredictions" confidence intervals for the mean predictions
    "PredictedResponse" fitted values for the data
    "SinglePredictionBands" confidence bands based on single observations
    "SinglePredictions" confidence intervals for the predicted response of single observations
  • Properties that measure goodness of fit include:
  • "AdjustedRSquared" adjusted for the number of model parameters
    "AIC" Akaike Information Criterion
    "AICc" finite sample corrected AIC
    "BIC" Bayesian Information Criterion
    "RSquared" coefficient of determination
  • The properties "BestFit", "BestFitAround", "BestFitDataAround", "SinglePredictionBands" and "MeanPredictionBands" can also be called as {"prop",x} or {"prop",{x1,x2,}} to evaluate these properties at specific independent values.
  • For the properties "RSquared" and "AdjustedRSquared", the computation of the total sum of squares is mean adjusted only when the constant basis is included.

Examples

open all close all

Basic Examples  (1)

Fit a linear model to some data:

Obtain the functional form:

Evaluate the model at a point:

Visualize the fitted function with the data:

Extract information about the fitting:

Plot the residuals:

Scope  (18)

Data  (8)

Fit a model of one variable assuming increasing integer independent values:

This is equivalent to:

Fit a model of more than one variable, assuming the response is the last one:

This is equivalent to:

Specify a column as the response:

Fit a list of rules:

Fit a rule of input values and responses:

Fit a model with categorical predictor variables:

Fit a model given a design matrix and response vector:

Fit the model referring to the basis functions as x and y:

Fit a Tabular object by specifying the response column:

Model  (3)

Find the best fit linear coefficient for a function:

Fit data to a linear combination of linear functions of independent variables:

This is equivalent to explicitly specifying a constant function:

Fit data to a linear combination of nonlinear functions of independent variables:

Properties  (7)

Data & Fitted Functions  (1)

Fit a linear model:

Obtain a list of available properties for a linear model:

Extract the original data:

Obtain and plot the best fit:

Obtain the best fit at a specific point:

Obtain the fitted function as a pure function:

Get the design matrix and response vector for the fitting:

Residuals  (1)

Examine residuals for a fit:

Visualize the raw fit residuals:

Visualize scaled residuals in stem plots:

Plot the absolute differences between the standardized and Studentized residuals:

Sums of Squares  (1)

Fit a linear model to some data:

Extract the estimated error variance and coefficient of variation:

Obtain an analysis of variance table for the model:

Get the F-statistics from the table:

Parameter Estimation Diagnostics  (1)

Obtain a formatted table of parameter information:

Obtain the -statistics of fitted parameters:

Influence Measures  (1)

Fit some data containing extreme values to a linear model:

Use single deletion variances to check the impact on the error variance of removing each point:

Check Cook distances to identify highly influential points:

Use DFFITS values to assess the influence of each point on the fitted values:

Use DFBETAS values to assess the influence of each point on each estimated parameter:

Prediction Values  (1)

Fit a linear model:

Plot the predicted values against the observed values:

Obtain tabular results for the mean prediction confidence intervals:

Obtain tabular results for the single prediction confidence intervals:

Get the single prediction intervals from the table:

Extract 99% mean prediction bands:

Compute the 99% mean prediction bands at a specific location:

Goodness-of-Fit Measures  (1)

Obtain a table of goodness-of-fit measures for a linear model:

Compute goodness-of-fit measures for all possible linear submodels:

Rank the models by :

Rank the models by adjusted , which penalizes for adding terms:

Generalizations & Extensions  (1)

Perform other mathematical operations on the functional form of the model:

Integrate symbolically and numerically:

Find a predictor value that gives a particular value for the model:

Options  (11)

ConfidenceLevel  (1)

The default gives 95% confidence intervals:

Use 99% intervals instead:

Set the level to 90% within FittedModel :

IncludeConstantBasis  (1)

Fit a simple linear regression model:

Fit the linear model with intercept zero:

LinearOffsetFunction  (1)

Fit data to a linear model:

Fit data to a linear model with a known Sqrt [x] term:

NominalVariables  (1)

Fit data treating the first variable as a nominal variable:

Treat both variables as nominal:

VarianceEstimatorFunction  (1)

Use the default unbiased estimate of error variance:

Assume a known error variance:

Estimate the variance by the mean squared error:

Weights  (5)

Fit a model using equal weights:

Give explicit weights for the data points:

Use Around values to give different weights to data points:

Find the weights that were used to account for the uncertainty in the data:

Use Around values in both the independent values and responses:

Fit a model of more than one variable with Around values:

Try the FixedPoint algorithm to find the weights for the model:

Reduce the damping factor and increase the MaxIterations to reach convergence:

WorkingPrecision  (1)

Use WorkingPrecision to get higher precision in parameter estimates:

Obtain the fitted function:

Reduce the precision in property computations after the fitting:

Applications  (6)

Fit the first 100 primes to a linear model:

Visualize the fit:

The systematic trend in the residuals violates the assumption of independent normal errors:

Fit a linear model of multiple variables:

Visually inspect the residuals by data point:

Plot the residuals against each predictor variable:

Plot Cook's distances to diagnose leverage:

Find the positions of distances above a given cutoff value:

Extract the associated data points:

Use - plots to check the assumption of normal errors:

Compare standardized residuals to standard normal values:

Do the comparison with Studentized residuals:

Simulate some data with a continuous and a nominal variable:

Fit an analysis of covariance model to the data:

Obtain an analysis of variance table for the model:

Group the data by treatment:

Visualize the grouped data and associated curves:

Use properties to compute additional results:

Extract the design matrix and residuals:

Compute White's heteroskedasticity-consistent covariance estimate:

Compare with the covariance assuming homoskedasticity:

Compare standard errors based on the two covariance estimates:

Perform a BreuschPagan test:

Fit a model:

Fit the squared errors to a model with the same predictors:

Compute the BreuschPagan test statistic:

Compute the -value:

Properties & Relations  (10)

DesignMatrix constructs the design matrix used by LinearModelFit :

By default, LinearModelFit and GeneralizedLinearModelFit fit equivalent models:

LinearModelFit fits linear models assuming normally distributed errors:

NonlinearModelFit fits nonlinear models assuming normally distributed errors:

Fit and LinearModelFit fit equivalent models:

LinearModelFit allows for extraction of additional information about the fitting:

Fit a linear model to data:

Perform the same fitting using a design matrix and response vector:

Obtain the parameter estimates via LeastSquares :

LinearModelFit fits linear models:

FindFit gives parameter estimates for linear and nonlinear models:

LinearModelFit will use the time stamps of a TimeSeries as variables:

Rescale the time stamps and fit again:

Find fit for the values:

LinearModelFit acts pathwise on a multipath TemporalData :

Do a simple linear model fit:

Do the same fit using a neural net with a single linear layer:

Compute the AIC from first principles:

Check the "AICc" property:

Check the "BIC" property:

Compute the from first principles:

If the model does not include a constant basis, the denominator is not mean adjusted:

Wolfram Research (2008), LinearModelFit, Wolfram Language function, https://reference.wolfram.com/language/ref/LinearModelFit.html (updated 2025).

Text

Wolfram Research (2008), LinearModelFit, Wolfram Language function, https://reference.wolfram.com/language/ref/LinearModelFit.html (updated 2025).

CMS

Wolfram Language. 2008. "LinearModelFit." Wolfram Language & System Documentation Center. Wolfram Research. Last Modified 2025. https://reference.wolfram.com/language/ref/LinearModelFit.html.

APA

Wolfram Language. (2008). LinearModelFit. Wolfram Language & System Documentation Center. Retrieved from https://reference.wolfram.com/language/ref/LinearModelFit.html

BibTeX

@misc{reference.wolfram_2025_linearmodelfit, author="Wolfram Research", title="{LinearModelFit}", year="2025", howpublished="\url{https://reference.wolfram.com/language/ref/LinearModelFit.html}", note=[Accessed: 25-October-2025]}

BibLaTeX

@online{reference.wolfram_2025_linearmodelfit, organization={Wolfram Research}, title={LinearModelFit}, year={2025}, url={https://reference.wolfram.com/language/ref/LinearModelFit.html}, note=[Accessed: 25-October-2025]}

Top [フレーム]

AltStyle によって変換されたページ (->オリジナル) /