Skip to content

Commit

Permalink
solved notes regarding documented arguments not in usage
Browse files Browse the repository at this point in the history
  • Loading branch information
lionelvoirol committed Aug 31, 2023
1 parent 8ab8a63 commit 9570957
Show file tree
Hide file tree
Showing 16 changed files with 27 additions and 45 deletions.
4 changes: 2 additions & 2 deletions CRAN-SUBMISSION
Original file line number Diff line number Diff line change
@@ -1,3 +1,3 @@
Version: 0.2.2
Date: 2023-08-29 14:56:31 UTC
SHA: b7a326c5f97df812dbcbe1dad222aceac0b42c1b
Date: 2023-08-30 08:43:27 UTC
SHA: 8ab8a63438bc87dfca119c32af684532a7e31946
9 changes: 0 additions & 9 deletions R/RcppExports.R
Original file line number Diff line number Diff line change
Expand Up @@ -366,7 +366,6 @@ set_seed <- function(seed) {

#' @title Conversion function of Vector to Set
#' @description Converts a vector into a set
#' @param x A \code{vec<vec<string>>} that contains a list of model descriptors.
#' @return A \code{set<vector<string>>} that contains the list of unique models.
#' @keywords internal
vector_to_set <- function(model_str) {
Expand Down Expand Up @@ -406,7 +405,6 @@ rank_models_cpp <- function(data, model_str, full_model, alpha, compute_v, model
#' @title Find the auto imu result
#' @description Provides the core material to create an S3 object for auto.imu
#' @param data A \code{mat} containing multiple columns of independent data with the same number of observations.
#' @param model_str A \code{vector<vector<string>>} that gives a list of models to test.
#' @param full_model A \code{vector<string>} that contains the largest / full model.
#' @param alpha A \code{double} that indicates the alpha level for CIs.
#' @param compute_v A \code{string} indicating the type of V matrix to generate
Expand Down Expand Up @@ -975,7 +973,6 @@ gen_sarima <- function(N, ar, d, ma, sar, sd, sma, sigma2 = 1.5, s = 12L, n_star
#' @param theta_values A \code{vec} containing the parameters for (S)AR and (S)MA.
#' @param objdesc A \code{vec} that contains the \code{\link{+.ts.model}}'s obj.desc field.
#' @param sigma2 A \code{double} that contains process variance.
#' @param s An \code{integer} that contains a seasonal id.
#' @param n_start An \code{unsigned int} that indicates the amount of observations to be used for the burn in period.
#' @return A \code{vec} that contains the generated observations.
#' @details
Expand Down Expand Up @@ -1073,8 +1070,6 @@ gmwm_engine <- function(theta, desc, objdesc, model_type, wv_empir, omega, scale
#' @param desc A \code{vector<string>} indicating the models that should be considered.
#' @param objdesc A \code{field<vec>} containing a list of parameters (e.g. AR(1) = c(1,1), ARMA(p,q) = c(p,q,1))
#' @param model_type A \code{string} that represents the model transformation
#' @param wv_empir A \code{vec} that contains the empirical wavelet variance
#' @param omega A \code{mat} that represents the covariance matrix.
#' @param scales A \code{vec} that contains the scales or taus (2^(1:J))
#' @param starting A \code{bool} that indicates whether we guessed starting (T) or the user supplied estimates (F).
#' @return A \code{field<mat>} that contains the parameter estimates from GMWM estimator.
Expand Down Expand Up @@ -1121,9 +1116,7 @@ gmwm_master_cpp <- function(data, theta, desc, objdesc, model_type, starting, al
#' @param num_param An \code{unsigned int} number of parameters in the model (e.g. # of thetas).
#' @param expect_diff A \code{double} that contains the mean of the first difference of the data
#' @param N A \code{integer} that contains the number of observations in the data.
#' @param wv_empir A \code{vec} that contains the empirical wavelet variance.
#' @param tau A \code{vec} that contains the scales. (e.g. 2^(1:J))
#' @param double A \code{double} that contains the drift slope given by \eqn{\frac{max-min}{N}}{(Max-Min)/N}
#' @param G A \code{integer} that indicates how many random draws that should be performed.
#' @return A \code{vec} containing smart parameter starting guesses to be iterated over.
#' @keywords internal
Expand Down Expand Up @@ -1334,10 +1327,8 @@ B_matrix <- function(A, at_omega) {
#' @title Model Score
#' @description Calculates the modeling score of a GMWM
#' @param A A \code{mat} that contains the first derivatives of the processes
#' @param At_j A \code{mat} that contains the second derivative of each process
#' @param omega A \code{mat} that contains the omega used when calculating the GMWM
#' @param v_hat A \code{mat} that contains the covariance matrix
#' @param diff A \code{vec} that is the difference of the WV empirical and WV theoretical
#' @return A \code{vec}
#' @keywords internal
#' @backref src/model_selection.cpp
Expand Down
2 changes: 1 addition & 1 deletion R/imu.r
Original file line number Diff line number Diff line change
Expand Up @@ -161,7 +161,7 @@ imu = function(data, gyros = NULL, accels = NULL, axis = NULL, freq = NULL, unit
#' @description Internal quick build for imu object.
#' @param data A \code{matrix} with dimensions N x length(index)
#' @param ngyros An \code{integer} containing the number of gyroscopes
#' @param naccess An \code{integer} containing the number of accelerometers
#' @param nacces An \code{integer} containing the number of accelerometers
#' @param axis A \code{vector} unique representation of elements e.g. x,y,z or x,y or x.
#' @param freq An \code{integer} that provides the frequency for the data.
#' @param unit A \code{string} that contains the unit expression of the frequency. Default value is \code{NULL}.
Expand Down
2 changes: 0 additions & 2 deletions man/auto_imu_cpp.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

4 changes: 2 additions & 2 deletions man/create_imu.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

2 changes: 0 additions & 2 deletions man/gen_generic_sarima.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

4 changes: 0 additions & 4 deletions man/gmwm_update_cpp.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

4 changes: 0 additions & 4 deletions man/guess_initial.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

4 changes: 0 additions & 4 deletions man/model_score.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

12 changes: 12 additions & 0 deletions man/simts-package.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

3 changes: 0 additions & 3 deletions man/vector_to_set.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

2 changes: 0 additions & 2 deletions src/automatic_models.cpp
Original file line number Diff line number Diff line change
Expand Up @@ -99,7 +99,6 @@ void set_seed(unsigned int seed) {

//' @title Conversion function of Vector to Set
//' @description Converts a vector into a set
//' @param x A \code{vec<vec<string>>} that contains a list of model descriptors.
//' @return A \code{set<vector<string>>} that contains the list of unique models.
//' @keywords internal
// [[Rcpp::export]]
Expand Down Expand Up @@ -678,7 +677,6 @@ arma::field< arma::field<arma::field<arma::mat> > > rank_models_cpp(arma::vec&
//' @title Find the auto imu result
//' @description Provides the core material to create an S3 object for auto.imu
//' @param data A \code{mat} containing multiple columns of independent data with the same number of observations.
//' @param model_str A \code{vector<vector<string>>} that gives a list of models to test.
//' @param full_model A \code{vector<string>} that contains the largest / full model.
//' @param alpha A \code{double} that indicates the alpha level for CIs.
//' @param compute_v A \code{string} indicating the type of V matrix to generate
Expand Down
1 change: 0 additions & 1 deletion src/gen_process.cpp
Original file line number Diff line number Diff line change
Expand Up @@ -772,7 +772,6 @@ arma::vec gen_sarima(const unsigned int N,
//' @param theta_values A \code{vec} containing the parameters for (S)AR and (S)MA.
//' @param objdesc A \code{vec} that contains the \code{\link{+.ts.model}}'s obj.desc field.
//' @param sigma2 A \code{double} that contains process variance.
//' @param s An \code{integer} that contains a seasonal id.
//' @param n_start An \code{unsigned int} that indicates the amount of observations to be used for the burn in period.
//' @return A \code{vec} that contains the generated observations.
//' @details
Expand Down
2 changes: 0 additions & 2 deletions src/gmwm_logic.cpp
Original file line number Diff line number Diff line change
Expand Up @@ -146,8 +146,6 @@ arma::vec gmwm_engine(const arma::vec& theta,
//' @param desc A \code{vector<string>} indicating the models that should be considered.
//' @param objdesc A \code{field<vec>} containing a list of parameters (e.g. AR(1) = c(1,1), ARMA(p,q) = c(p,q,1))
//' @param model_type A \code{string} that represents the model transformation
//' @param wv_empir A \code{vec} that contains the empirical wavelet variance
//' @param omega A \code{mat} that represents the covariance matrix.
//' @param scales A \code{vec} that contains the scales or taus (2^(1:J))
//' @param starting A \code{bool} that indicates whether we guessed starting (T) or the user supplied estimates (F).
//' @return A \code{field<mat>} that contains the parameter estimates from GMWM estimator.
Expand Down
15 changes: 10 additions & 5 deletions src/guess_values.cpp
Original file line number Diff line number Diff line change
Expand Up @@ -180,16 +180,21 @@ arma::vec draw_ar1_memory_large(double sigma2_total, double last_phi){
//' @param num_param An \code{unsigned int} number of parameters in the model (e.g. # of thetas).
//' @param expect_diff A \code{double} that contains the mean of the first difference of the data
//' @param N A \code{integer} that contains the number of observations in the data.
//' @param wv_empir A \code{vec} that contains the empirical wavelet variance.
//' @param tau A \code{vec} that contains the scales. (e.g. 2^(1:J))
//' @param double A \code{double} that contains the drift slope given by \eqn{\frac{max-min}{N}}{(Max-Min)/N}
//' @param G A \code{integer} that indicates how many random draws that should be performed.
//' @return A \code{vec} containing smart parameter starting guesses to be iterated over.
//' @keywords internal
// [[Rcpp::export]]
arma::vec guess_initial(const std::vector<std::string>& desc, const arma::field<arma::vec>& objdesc,
std::string model_type, unsigned int num_param, double expect_diff, unsigned int N,
const arma::mat& wv, const arma::vec& tau, double ranged, unsigned int G){
arma::vec guess_initial(const std::vector<std::string>& desc,
const arma::field<arma::vec>& objdesc,
std::string model_type,
unsigned int num_param,
double expect_diff,
unsigned int N,
const arma::mat& wv,
const arma::vec& tau,
double ranged,
unsigned int G){

// Obtain the sum of variances for sigma^2_total.

Expand Down
2 changes: 0 additions & 2 deletions src/model_selection.cpp
Original file line number Diff line number Diff line change
Expand Up @@ -53,10 +53,8 @@ arma::mat B_matrix(const arma::mat& A, const arma::mat& at_omega){
//' @title Model Score
//' @description Calculates the modeling score of a GMWM
//' @param A A \code{mat} that contains the first derivatives of the processes
//' @param At_j A \code{mat} that contains the second derivative of each process
//' @param omega A \code{mat} that contains the omega used when calculating the GMWM
//' @param v_hat A \code{mat} that contains the covariance matrix
//' @param diff A \code{vec} that is the difference of the WV empirical and WV theoretical
//' @return A \code{vec}
//' @keywords internal
//' @backref src/model_selection.cpp
Expand Down

0 comments on commit 9570957

Please sign in to comment.