Skip to content

Commit e34e1c0

Browse files
Rename estimAMSE to estim_tilde_AMSE
1 parent 5f36f90 commit e34e1c0

File tree

3 files changed

+27
-24
lines changed

3 files changed

+27
-24
lines changed

NAMESPACE

+1-1
Original file line numberDiff line numberDiff line change
@@ -22,5 +22,5 @@ export(compute_matrix_alpha)
2222
export(derivative.psi)
2323
export(derivative.rho)
2424
export(derivative.tau)
25-
export(estimAMSE)
25+
export(estim_tilde_AMSE)
2626
export(vectorized_Faa_di_Bruno)

R/EllDistrEst-adaptive.R

+16-15
Original file line numberDiff line numberDiff line change
@@ -94,11 +94,11 @@ EllDistrEst.adapt <- function(X, mu = 0, Sigma_m1 = diag(NCOL(X)),
9494
cat("Estimation of the AMSE...\n")
9595
for (i_a in 1:length(grid_a)){
9696
a = grid_a[i_a]
97-
AMSE_estimated[i_a, ] = estimAMSE(X = X, mu = mu, Sigma_m1 = Sigma_m1,
98-
grid = grid, h = h_firstStep_AMSE,
99-
Kernel = Kernel, a = a,
100-
mpfr = mpfr, precBits = precBits,
101-
dopb = FALSE)
97+
AMSE_estimated[i_a, ] = estim_tilde_AMSE(X = X, mu = mu, Sigma_m1 = Sigma_m1,
98+
grid = grid, h = h_firstStep_AMSE,
99+
Kernel = Kernel, a = a,
100+
mpfr = mpfr, precBits = precBits,
101+
dopb = FALSE)
102102
}
103103
best_a = rep(NA, length(grid))
104104
best_AMSE_abs = rep(NA, length(grid))
@@ -139,14 +139,15 @@ EllDistrEst.adapt <- function(X, mu = 0, Sigma_m1 = diag(NCOL(X)),
139139
}
140140

141141

142-
#' Estimate the AMSE
143-
#'
144-
#' @author Alexis Derumigny, Victor Ryan
142+
#' Estimate the part of the AMSE of the elliptical density generator that only depends
143+
#' on the parameter "a"
145144
#'
146145
#' @inheritParams EllDistrEst
147146
#'
148147
#' @returns a vector of the same size as the grid, with the corresponding value
149-
#' for the AMSE.
148+
#' for the \eqn{\widetilde{AMSE}}.
149+
#'
150+
#' @author Alexis Derumigny, Victor Ryan
150151
#'
151152
#' @examples
152153
#' # Comparison between the estimated and true generator of the Gaussian distribution
@@ -156,7 +157,7 @@ EllDistrEst.adapt <- function(X, mu = 0, Sigma_m1 = diag(NCOL(X)),
156157
#' grid = seq(0, 5, by = 0.1)
157158
#' a = 1.5
158159
#'
159-
#' AMSE_est = estimAMSE(X = X, grid = grid, a = a, h = 0.09)
160+
#' AMSE_est = estim_tilde_AMSE(X = X, grid = grid, a = a, h = 0.09)
160161
#' plot(grid, abs(AMSE_est), type = "l")
161162
#'
162163
#' # Computation of true values
@@ -187,7 +188,7 @@ EllDistrEst.adapt <- function(X, mu = 0, Sigma_m1 = diag(NCOL(X)),
187188
#'
188189
#' AMSE_est = rep(NA, length = length(vec_a))
189190
#' for (i in 1:length(vec_a)){
190-
#' AMSE_est[i] = estimAMSE(X = X, grid = grid, a = vec_a[i], h = 0.09,
191+
#' AMSE_est[i] = estim_tilde_AMSE(X = X, grid = grid, a = vec_a[i], h = 0.09,
191192
#' dopb = FALSE)
192193
#' }
193194
#'
@@ -217,11 +218,11 @@ EllDistrEst.adapt <- function(X, mu = 0, Sigma_m1 = diag(NCOL(X)),
217218
#' ylim = c(yliminf, ylimsup))
218219
#' lines(vec_a, abs(AMSE), col = "red")
219220
#'
220-
#' @export estimAMSE
221+
#' @export estim_tilde_AMSE
221222
#'
222-
estimAMSE <- function(X, mu = 0, Sigma_m1 = diag(NCOL(X)),
223-
grid, h, Kernel = "gaussian", a = 1,
224-
mpfr = FALSE, precBits = 100, dopb = TRUE)
223+
estim_tilde_AMSE <- function(X, mu = 0, Sigma_m1 = diag(NCOL(X)),
224+
grid, h, Kernel = "gaussian", a = 1,
225+
mpfr = FALSE, precBits = 100, dopb = TRUE)
225226
{
226227
etahat1 = compute_etahat(
227228
X = X, mu = mu, Sigma_m1 = Sigma_m1,

man/estimAMSE.Rd man/estim_tilde_AMSE.Rd

+10-8
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

0 commit comments

Comments
 (0)