GROAN package allows to assess the performances of one or more genomic regressors when artificial noise is injected in an existing dataset. It is possible, however, to use GROAN to simply compare the prediction accuracy of different regression models without the injection of extra noise. Tests can either be performed on a single dataset (through crossvalidation) or multiple datasets (one for training, and one or more for testing). Crossvalidation and data management are transparent and the user is only required high level input.
The general workflow is the following:
GROAN package does not directly contain regressors, but leverages those implemented in the following packages (if installed):
If you want to test your own regressor (or one taken from another package) you need to write a wrapper function, as detailed here.
If you want to customize the type of injected noise you need to write a noise injector function, as detailed here.
In the rest of this document we refer to GROAN.KI and GROAN.AI, two dataset included in the package. GROAN.KI and GROAN.AI contain data of 103 and 105 pea lines, respectively. The pea samples were genotyped for 647 SNPs coming from genotyping-by-sequencing (GBS). The datasets contain also a single phenotypic trait (grain yield, measured in t/ha). The datasets come in the form of two list, each one containing the following fields:
library(GROAN)
#arrays of phenotypes
$yield
GROAN.KI$yield
GROAN.AI
#dataframes of SNP genotypes
$SNPs
GROAN.KI$SNPs
GROAN.AI
#dataframes of realized genotypic kinship
$kinship
GROAN.KI$kinship GROAN.AI
For more details on the data format please refer to the package help. For more details on the datasets in general please refer to:
Annicchiarico et al., GBS-Based Genomic Selection for Pea Grain Yield under Severe Terminal Drought, The Plant Genome, Volume 10.
A GROAN.NoisyDataset is an object containing an instance of the original (noiseless) data and a reference to a noise injector function. It is created using the createNoisyDataset function. If no noise injector function is specified, no noise will be added (the default noise injector, noiseInjector.dummy, does not add noise).
#creating a GROAN.NoisyDataset without any extra noise injected
= createNoisyDataset(
nds.no_noise name = "PEA KI, no noise",
genotypes = GROAN.KI$SNPs,
phenotypes = GROAN.KI$yield
)
#creating a GROAN.NoisyDataset adding noise sampled from a normal distribution
= createNoisyDataset(
nds.normal_noise name = "PEA KI, normal noise",
genotypes = GROAN.KI$SNPs,
phenotypes = GROAN.KI$yield,
noiseInjector = noiseInjector.norm,
mean = 0,
sd = sd(GROAN.KI$yield) * 0.5
)
#creating a third dataset, this time with data from the AI lines
= createNoisyDataset(
nds.no_noise.AI name = "PEA AI, no noise",
genotypes = GROAN.AI$SNPs,
phenotypes = GROAN.AI$yield
)
The noise is injected on demand each time the function getNoisyPhenotype is invoked:
#plotting the original phenotypes
plot(GROAN.KI$yield, pch=20, main = "True (black) vs. Noisy (red)", xlab = "Samples", ylab = "Phenotypes")
#plotting an instance of the phenotypes with noise injected
points(getNoisyPhenotype(nds.normal_noise), col="red")
Noise injectors usually leverage a stochastic mechanism to add noise. Therefore, successive calls to getNoisyPhenotype produce (slightly) different results.
#average correlation oscillates around 0.89
cor(GROAN.KI$yield, getNoisyPhenotype(nds.normal_noise))
cor(GROAN.KI$yield, getNoisyPhenotype(nds.normal_noise))
cor(GROAN.KI$yield, getNoisyPhenotype(nds.normal_noise))
## [1] 0.9044778
## [1] 0.8935893
## [1] 0.8677829
Obviously in absence of noise no variability is present.
#no noise injector ==> the original phenotypes are returned
all(GROAN.KI$yield == getNoisyPhenotype(nds.no_noise))
## [1] TRUE
It is possible to invoke both print and summary methods to quickly inspect the created objects
print(nds.no_noise)
## value
## dataset.name PEA KI, no noise
## ploidy 2
## samples 103
## SNPs.num 647
## covariance absent
## extraCovariates absent
## strata absent
print(nds.no_noise.AI)
## value
## dataset.name PEA AI, no noise
## ploidy 2
## samples 105
## SNPs.num 647
## covariance absent
## extraCovariates absent
## strata absent
The following noise injectors are implemented in GROAN:
Function name | Effect |
---|---|
noiseInjector.dummy | No effect, used for comparing models without adding noise |
noiseInjector.norm | Injects normal (gaussian) noise |
noiseInjector.swapper | Swaps phenotypes between samples |
noiseInjector.unif | Injects uniform noise |
It is possible to extend GROAN functionalities by writing your own noise injector, as detailed here.
A GROAN.Workbench is an object describing both the regressor(s) that will be tested and some configuration regarding the test itself. A GROAN.Workbench object is created using the createWorkbench function. The main parameters of interest are:
In its simplest form, a GROAN.Workbench can be created using all defaults. So this call:
#creating a Workbench with default values
= createWorkbench() wb
is equivalent to the following one, where all default parameters are explicitly assigned:
#creating a GROAN.Workbench with default values explicitly assigned
= createWorkbench(
wb #parameters defining crossvalidation
folds = 5, reps = 10, stratified = FALSE,
#parameters defining save-on-hard-disk policy
outfolder = NULL, saveHyperParms = FALSE, saveExtraData = FALSE,
#a regressor
regressor = phenoRegressor.rrBLUP, regressor.name = "rrBLUP"
)
Actually, the default regressor.name is “default regressor”, but it was changed in the example for clarity.
It is possible to update the GROAN.Workbench object by adding other regressors using the addRegressor function:
#adding a regressor to an existing Workbench
= addRegressor(
wb #the Workbench to be updater
wb,#the new regressor
regressor = phenoRegressor.BGLR, regressor.name = "Bayesian Lasso",
#regressor-specific parameters
type = "BL"
)
The previous operation can be repeated as many times as necessary. Just remember to actually update the Workbench instance, and to assign sensible names to the regressors (they will be used, later, to investigate the results).
It is possible to invoke the print method to quickly inspect the created objects:
print(wb)
## --- EXPERIMENT ---
## folds : 5
## reps : 10
## stratified : FALSE
## outfolder : NULL
## saveHyperParms : FALSE
## saveExtraData : FALSE
## --- REGRESSORS ---
## Regressor 1 : rrBLUP
## Regressor 2 : Bayesian Lasso
The following regressors are implemented in GROAN:
Function name | Effect |
---|---|
phenoRegressor.BGLR | Regressors from BGLR package (Bayes A, B, C, Bayesian Lasso, G-BLUP, RKHS, …) |
phenoRegressor.dummy | A dummy function returning random values, for test/development purposes. |
phenoRegressor.RFR | Random forest regression from package randomForest (caution: very slow) |
phenoRegressor.rrBLUP | Regressor from rrBLUP package, implements SNP blup with ridge-regression-like solution |
phenoRegressor.SVR | Support Vector Regression from package e1071. It can operate in three modes: a) no training (an existing SVR object is needed), b) training (when hyperparameters are known) and c) tuning (when hyperparameters need to be optimized in a grid search, very slow) |
It is possible to extend GROAN functionalities by writing your own regressor, as detailed here
To run GROAN you need at least GROAN.NoisyDataset object and a GROAN.Workbench object. Once you have them the actual test is executed using the GROAN.run function.
The result is a GROAN.Result, an object that behaves like a data
frame with one row per regressor times the number of
repetitions times the number of test sets. In case of
simple crossvalidation, each row represents a full crossvalidation of
one regressor on the dataset. Columns contain measures of correlation
between real and predicted phenotypes, measures of error, and execution
time. The GROAN.Result can be saved automatically on hard disk by
setting parameter outfolder
in the Workbench. In case of
crossvalidation the test dataset in the result object will report the
“[CV]” suffix.
Details are reported in GROAN.run documentation.
For reporting purposes it is possible to collate together (and filter) several result data frames, as shown here:
#executing two GROAN test, same workbench, different datasets
= GROAN.run(nds.no_noise, wb)
res.no_noise = GROAN.run(nds.normal_noise, wb)
res.normal_noise
#putting the results together for further analysis
= rbind(res.no_noise, res.normal_noise) res.total
The returned GROAN.Result has both a print and a summary method, but for quick inspection it’s possible to use the plotResult function. The function leverages the ggplot2 package and returns a ggplot object. It is possible to select the performance measure to be plotted, together with the type of plot.
#defaults is a boxplot of Pearson's correlations
= plotResult(res.total)
p print(p)
#a barplot with 95% confidence interval of Pearson's correlations
= plotResult(res.total, plot.type = "bar_conf95")
p print(p)
#a barplot of execution times per fold, in seconds
= plotResult(res.total, plot.type = "bar", variable = "time")
p print(p)
When calling function createWorkbench set argument
stratified
to TRUE to tell GROAN to take into account data
strata. This will have two effects:
Data strata are defined within the GROAN.NoisyDataset through
parameter strata
in
createNoisyDataset.
In the following code datasets GROAN.KI and GROAN.AI are put together, and strata are used to separate the two crosses.
#collating the two example datasets
= createNoisyDataset(
nds.double name = "KI and AI",
genotypes = rbind(GROAN.KI$SNPs, GROAN.AI$SNPs),
phenotypes = c(GROAN.KI$yield, GROAN.AI$yield),
strata = c(rep("KI", 103), rep("AI", ,105)) #we have 103 KI and 105 AI
)
#the workbench will take into account strata
= createWorkbench(stratified = TRUE)
wb
#ready to go
= GROAN.run(nds.double, wb)
res plotResult(res, strata = "single", plot.type = "bar")
It is possible to use GROAN to train models on one dataset and test
them on one or more others. This is obtained through the parameter
nds.test
in GROAN.run invocation:
#a new GROAN.Workbench with NO crossvalidation and only one repetition
= createWorkbench(
wb folds = NULL, reps = 1,
regressor.name = "rrBLUP", regressor = phenoRegressor.rrBLUP)
#training on PEA.KI, testing on PEA.AI
= GROAN.run(nds = nds.normal_noise, wb = wb, nds.test = nds.no_noise.AI)
res
print(res[,c("dataset.train", "dataset.test", "pearson")])
dataset.train | dataset.test | pearson |
---|---|---|
PEA KI, normal noise | PEA AI, no noise | 0.1690525 |
It is also possible to mix up crossvalidation with testing with different datasets:
#a new GROAN.Workbench with 5-fold crossvalidation and only one repetition
= createWorkbench(
wb folds = 5, reps = 1,
regressor.name = "rrBLUP", regressor = phenoRegressor.rrBLUP)
#training on PEA.KI, testing on PEA.KI (crossvalidation) and PEA.AI
= GROAN.run(nds = nds.normal_noise, wb = wb, nds.test = nds.no_noise.AI)
res
print(res[,c("dataset.train", "dataset.test", "pearson")])
dataset.train | dataset.test | pearson |
---|---|---|
PEA KI, normal noise | PEA AI, no noise | 0.2045428 |
PEA KI, normal noise | PEA KI, normal noise [CV] | 0.7613710 |
To test the model on more than one extra dataset simply put them in a list:
#training on PEA.KI, testing on PEA.KI (crossvalidation), PEA.AI, and PEA.KI again (overfitting!)
= GROAN.run(
res nds = nds.normal_noise, wb = wb,
nds.test = list(nds.no_noise.AI, nds.no_noise)
)
print(res[,c("dataset.train", "dataset.test", "pearson")])
dataset.train | dataset.test | pearson |
---|---|---|
PEA KI, normal noise | PEA AI, no noise | 0.2633936 |
PEA KI, normal noise | PEA KI, no noise | 0.8923094 |
PEA KI, normal noise | PEA KI, normal noise [CV] | 0.7955882 |
The data frame returned by GROAN.run contains the basic performance evaluation operated by GROAN. Several extra information can be stored on hard disk for later examination. This is done setting the appropriate policy on data saving when creating the GROAN.Workbench object. The following options are available:
Mode | How | What |
---|---|---|
Don’t save anything | outfolder=NULL | Nothing will be saved on hard disk. |
Save summary | outfolder=‘some/path’ | A subfolder will be created in the passed path, named after the run.id, containing an “accuracy.csv” file. |
…and hyperparameters | outfolder=‘some/path’ saveHyperParms=TRUE |
Same as above, but save also hyperparameters from regressor tuning in csv format. |
…and extra data | outfolder=‘some/path’ saveExtraData=TRUE |
Same as above, but save also extra data from regressor tuning in R format. |
Hyperparameters are (usually numeric) values tuned during training phase. Not all regressors require hyperparameter tuning, and the exact nature of hyperparameters depends on the regressor.
Extra data are saved using R save function, and can be accessed using the load function. One extra data bundle is save for each regressor times crossvalidation folds times experiment repetitions. Each bundle will usually contain at least the tuned model, but details depend on regressor function.
Once you have decided what regressor (and what hyper parameters configuration) is best for your data you may want to do actual phenotype predictions. To do so you can directly call one of the available phenoRegressor functions. For the sake of argument, let’s use half of the GROAN.KI dataset for training and let’s predict the other half. Each phenoRegressor will predict “the holes” in the passed phenotypes, meaning that it will fill all slots containing NA with a predicted phenotype.
#GROAN.KI has 103 samples, we'll use the first 50 samples for training
#and the remaining will be predicted
= GROAN.KI$yield
my.pheno 51:103] = NA
my.pheno[
#doing the predictions
= phenoRegressor.rrBLUP(phenotypes = my.pheno, genotypes = GROAN.KI$SNPs)
res
#we just obtained a list with the following fields
print(names(res))
## [1] "predictions" "hyperparams" "extradata"
#visualize the predictions
plot(
x = GROAN.KI$yield[51:103], xlab = "Real values",
y = res$predictions[51:103], ylab = "Predicted values"
)abline(a=0, b=1) #adding first quadrant bisector, for reference
If none of the available noise injectors satisfies your needs it is possible to write and use a custom injector in your experiments. This is done in two steps: 1) write the injector 2) include it in a GROAN.NoisyDataSet object.
Custom injectors need to accept at least one argument called
phenotypes
. When GROAN calls the injector this argument
will be a numeric array containing the phenotypes that will be used to
train the regressor(s). The function is required to return a numeric
array of the same size as “phenotypes”, with its values added of noise.
For the sake of arguments let’s suppose we want to investigate the
effects of a bias noise acting on a half of the data, as illustrated by
the following code:
#A noise injector adding a fixed bias to a random subset of about 50% of the data
= function(phenotypes){
my.noiseInjector.bias #an array of random booleans
= runif(length(phenotypes)) > 0.5
labels
#adding the bias (a fixed value of 5)
= phenotypes[labels] + 5
phenotypes[labels]
#returning the original phenotypes with added noise
return(phenotypes)
}
To use the injector we just defined we need to include it in the definition of a GROAN.NoisyDataSet:
#A GROAN.NoisyDataSet that embeds the bias noise
= createNoisyDataset(
nds.bias_noise name = "PEA, bias noise",
genotypes = GROAN.KI$SNPs,
phenotypes = GROAN.KI$yield,
noiseInjector = my.noiseInjector.bias #the function we defined above
)
It is possible for the noise injector function to have extra arguments other than phenotypes. In the following version of the bias noise injector the amount of bias is an input from the user:
#An improved version of the above function, this time the bias is not fixed
= function(phenotypes, bias = 5){
my.noiseInjector.bias2 #an array of random booleans
= runif(length(phenotypes)) > 0.5
labels
#adding the bias (from the function argument)
= phenotypes[labels] + bias
phenotypes[labels]
#returning the original phenotypes with added noise
return(phenotypes)
}
The call to createNoisyDataset can now assign values to the noise injector arguments:
#A NoisyDataSet with bias noise function, using the second version of the function
= createNoisyDataset(
nds.bias_noise2 name = "PEA, bias noise, second function",
genotypes = GROAN.KI$SNPs,
phenotypes = GROAN.KI$yield,
noiseInjector = my.noiseInjector.bias2, #the new version
bias = 20 #if omitted the default would be used
)
Please pay attention to avoid naming conflicts between the new regressor arguments and the ones from createNoisyDataset. Once the function is defined and embedded in a GROAN.NoisyDataset it is possible to select a regressor and test the effect of the newly defined noise.
If none of the available regressors satisfies your needs it is possible to write a custom regressor for your experiments. This is done in two steps: 1) write the regressor function 2) include it in a GROAN.WorkBench object.
Please understand that the regressor will be called in a crossvalidation procedures. It will thus have access to the complete genotypes (SNPs and/or covariances) and covariates, but the phenotype array willvcontain some missing values (NAs). This are the values to be predicted.
Each custom regressor function needs to accept the following input arguments:
phenotypes
: a numeric array (N x 1), missing values
are to be predicted.genotypes
: genotypes, one row per phenotype (N), one
column per marker (M), values in 0/1/2 (for diploids) or 0/1/2/…/ploidy
in case of polyploids. Order is such that each row has a corresponding
slot in the phenotypes array. Some rows will thus correspond to missing
values.covariances
: numeric matrix of covariances between
samples. It is usually a square (NxN) matrix, but rectangular matrices
(NxW) are accepted to incapsulate covariances between samples of one set
and samples of other sets. Order is such that each row will have a
corresponding slot in the phenotypes array. Some rows and columns will
thus correspond to missing values.extraCovariates
: extra covariates set, one row per
phenotype (N), one column per covariate (K). If NULL no extra covariates
are to be considered....
: zero or more extra parameters can be added to
further define the behaviour of the regression algorithm.Checks on input (type, size) are not required, since these functions are supposed to be used in a GROAN experiment, where checks are done when NoisyDataset and Workbench are created. Please note that the variables will reflect what is stored in the NoisyDataSet object. The function should return a list with the following fields:
The following snippet of code shows the implementation of phenoRegressor.dummy function. The “predictions” are actually random values, with genotypes, covariances and extra covariates being ignored. It is useful to show the required function signature.
= function (phenotypes, genotypes, covariances, extraCovariates){
phenoRegressor.dummy #no operation is actually required
return(list(
predictions = runif(length(phenotypes)), #predictions
hyperparams = c(some = 1, params="a"),
extradata = "filler extra data for phenoRegressor.dummy"
)) }
The function above can be used as regressor
argument for
both createWorkbench and addRegressor
functions.