qrglasso {QuantRegGLasso}R Documentation

Adaptively Weighted Group Lasso

Description

The function qrglasso performs Adaptively Weighted Group Lasso for semiparametric quantile regression models. It estimates the coefficients of a quantile regression model with adaptively weighted group lasso regularization. The algorithm supports the use of B-spline basis functions to model the relationship between covariates and the response variable. Regularization is applied across different groups of covariates, and an adaptive weighting scheme is employed to enhance variable selection.

Usage

qrglasso(
  Y,
  W,
  p,
  omega = NULL,
  tau = 0.5,
  qn = 1,
  lambda = NULL,
  maxit = 1000,
  thr = 1e-04
)

Arguments

Y

A n \times 1 data matrix where n is the sample size.

W

A n \times (p \times L) B-spline matrix where L is the number of groups and p is the number of covariates.

p

A numeric indicating the number of covariates.

omega

A p \times 1 weight matrix. Default value is NULL.

tau

A numeric quantile of interest. Default value is 0.5.

qn

A numeric bound parameter for HDIC. Default value is 1.

lambda

A sequence of tuning parameters. Default value is NULL.

maxit

The maximum number of iterations. Default value is 1000.

thr

Threshold for convergence. Default value is 10^{-4}.

Value

A list with the following components:

gamma

A target estimate.

xi

An auxiliary estimate in the ADMM algorithm.

phi

An auxiliary estimate in the ADMM algorithm.

BIC

A sequence of BIC values with respect to different lambdas.

lambda

A sequence of tuning parameters used in the algorithm.

L

The number of groups.

omega

A p \times 1 weight matrix used in the algorithm.

Author(s)

Wen-Ting Wang

References

Toshio Honda, Ching-Kang Ing, Wei-Ying Wu (2019). Adaptively weighted group Lasso for semiparametric quantile regression models. Bernoulli 225 4B.

Examples

# Example: One true non-linear covariate function
# Define the function g1
g1 <- function(x) { 
  (3 * sin(2 * pi * x) / (2 - sin(2 * pi * x))) - 0.4641016 
}

# Set parameters
n <- 100
p <- 50
err_sd <- 0.1 ** 2
tau <- 0.7

# Generate synthetic data
set.seed(1234)
x <- matrix(runif(n * p, min = 0, max = 1), n, p)
error_tau <- rnorm(n, sd = err_sd) - qnorm(tau, sd = err_sd)
y <- g1(x[, 1]) + error_tau
y <- y - mean(y)

# B-spline parameters
total_knots <- 5
degree <- 2
boundaries <- c(0, 1)
xx <- seq(from = 0, to = 1, length.out = total_knots)
knots <- xx[2:(total_knots - 1)]

# Create B-spline matrix W
L <- total_knots + degree - 1
bspline_results <- lapply(1:n, function(i) orthogonize_bspline(knots, boundaries, degree, x[i, ]))
W <- matrix(
   t(sapply(bspline_results, function(result) sqrt(L) * result$bsplines[, -1])), 
   ncol = p * (L - 1),
   byrow = TRUE
)

# Perform quantile regression with group Lasso
n_lambda <- 10
max_lambda <- 10
lambda <- c(0, exp(seq(log(max_lambda / 1e4), log(max_lambda), length = (n_lambda - 1))))
result <- qrglasso(as.matrix(y), W, p)
# BIC Results
plot(result)
# Prediction
estimate = predict(result, top_k = 1)
plot(estimate)


[Package QuantRegGLasso version 1.0.0 Index]