denovo.grid {OmicsMarkeR} | R Documentation |
Greates grid for optimizing selected models
denovo.grid(data, method, res)
data |
data of method to be tuned |
method |
vector indicating the models to generate grids.
Available options are |
res |
Resolution of model optimization grid. |
A list containing dataframes of all combinations of parameters for each model:
Charles Determan Jr
"expand.grid"
for generating grids of specific
parameters desired. However, NOTE that you must still convert
the generated grid to a list.
# random test data set.seed(123) dat.discr <- create.discr.matrix( create.corr.matrix( create.random.matrix(nvar = 50, nsamp = 100, st.dev = 1, perturb = 0.2)), D = 10 ) df <- data.frame(dat.discr$discr.mat, .classes = dat.discr$classes) # create tuning grid denovo.grid(df, "gbm", 3)