#' @eval get_description('PLSDA')
#' @export PLSDA
#' @include PLSR_class.R
#' @examples
#' M = PLSDA('number_components'=2,factor_name='Species')
PLSDA = function(number_components=2,factor_name,pred_method='max_prob',...) {
    out=struct::new_struct('PLSDA',
                           number_components=number_components,
                           factor_name=factor_name,
                           pred_method=pred_method,
                           ...)
    return(out)
}
.PLSDA<-setClass(
    "PLSDA",
    contains=c('PLSR'),
    slots=c(
        number_components='entity',
        factor_name='entity',
        scores='DatasetExperiment',
        loadings='data.frame',
        yhat='data.frame',
        design_matrix='data.frame',
        y='data.frame',
        reg_coeff='data.frame',
        probability='data.frame',
        vip='data.frame',
        pls_model='list',
        pred='data.frame',
        threshold='numeric',
        sr = 'entity',
        sr_pvalue='entity',
        pred_method='entity'
        
    ),
    prototype = list(
        name='Partial least squares discriminant analysis',
        type="classification",
        predicted='pred',
        libraries='pls',
        description=paste0(
            'PLS is a multivariate regression technique that ',
            'extracts latent variables maximising covariance between the input ',
            'data and the response. The Discriminant Analysis variant uses group ',
            'labels in the response variable. For >2 groups a 1-vs-all ',
            'approach is used. Group membership can be predicted for test ',
            'samples based on a probability estimate of group membership, ', 
            'or the estimated y-value.'),
        .params=c('number_components','factor_name','pred_method'),
        .outputs=c(
            'scores',
            'loadings',
            'yhat',
            'design_matrix',
            'y',
            'reg_coeff',
            'probability',
            'vip',
            'pls_model',
            'pred',
            'threshold',
            'sr',
            'sr_pvalue'),
        
        number_components=entity(
            value = 2,
            name = 'Number of components',
            description = 'The number of PLS components',
            type = c('numeric','integer')
        ),
        factor_name=ents$factor_name,
        pred_method=enum(
            name='Prediction method',
            description=c(
                'max_yhat'=
                    paste0('The predicted group is selected based on the ',
                           'largest value of y_hat.'),
                'max_prob'=
                    paste0('The predicted group is selected based on the ',
                           'largest probability of group membership.')
            ),
            value='max_prob',
            allowed=c('max_yhat','max_prob'),
            type='character',
            max_length=1
        ),
        sr = entity(
            name = 'Selectivity ratio',
            description = paste0(
                "Selectivity ratio for a variable represents a measure of a ",
                "variable's importance in the PLS model. The output data.frame ",
                "contains a column of selectivity ratios, a column of p-values ",
                "based on an F-distribution and a column indicating ",
                "significance at p < 0.05."
            ),
            type='data.frame'
        ),
        sr_pvalue = entity(
            name = 'Selectivity ratio p-value',
            description = paste0(
                "A p-value computed from the Selectivity Ratio based on an ",
                "F-distribution."
            ),
            type='data.frame'
        ),
        ontology='STATO:0000572',
        citations=list(
            bibentry(
                bibtype ='Article',
                year = 2009,
                volume = 95,
                number = 2,
                pages = '122-128',
                author = as.person("Nestor F. Perez and Joan Ferre and Ricard Boque"),
                title = paste0('Calculation of the reliability of ',
                               'classification in discriminant partial least-squares ',
                               'binary classification'),
                journal = "Chemometrics and Intelligent Laboratory Systems"
            ),
            bibentry(
                bibtype='Article',
                year = 2003,
                volume = 17,
                number = 3,
                pages = '166-173',
                author = as.person('Matthew Barker and William Rayens'),
                title = 'Partial least squares for discrimination',
                journal = 'Journal of Chemometrics'
            )
        )
    )
)
#' @export
#' @template model_train
setMethod(f="model_train",
          signature=c("PLSDA",'DatasetExperiment'),
          definition=function(M,D)
          {
              SM=D$sample_meta
              y=SM[[M$factor_name]]
              # convert the factor to a design matrix
              z=model.matrix(~y+0)
              z[z==0]=-1 # +/-1 for PLS
              
              X=as.matrix(D$data) # convert X to matrix
              
              Z=as.data.frame(z)
              colnames(Z)=as.character(interaction('PLSDA',1:ncol(Z),sep='_'))
              
              D$sample_meta=cbind(D$sample_meta,Z)
              
              # PLSR model
              N = PLSR(number_components=M$number_components,factor_name=colnames(Z))
              N = model_apply(N,D)
              
              # copy outputs across
              output_list(M) = output_list(N)
              
              # some specific outputs for PLSDA
              output_value(M,'design_matrix')=Z
              output_value(M,'y')=D$sample_meta[,M$factor_name,drop=FALSE]
              
              # for PLSDA compute probabilities
              probs=prob(as.matrix(M$yhat),as.matrix(M$yhat),D$sample_meta[[M$factor_name]])
              output_value(M,'probability')=as.data.frame(probs$ingroup)
              output_value(M,'threshold')=probs$threshold
              
              # update column names for outputs
              colnames(M$reg_coeff)=levels(y)
              colnames(M$sr)=levels(y)
              colnames(M$vip)=levels(y)
              colnames(M$yhat)=levels(y)
              colnames(M$design_matrix)=levels(y)
              colnames(M$probability)=levels(y)
              names(M$threshold)=levels(y)
              colnames(M$sr_pvalue)=levels(y)
              
              return(M)
          }
)
#' @export
#' @template model_predict
setMethod(f="model_predict",
          signature=c("PLSDA",'DatasetExperiment'),
          definition=function(M,D)
          {
              # call PLSR predict
              N=callNextMethod(M,D)
              SM=N$y
              
              ## probability estimate
              # http://www.eigenvector.com/faq/index.php?id=38%7C
              p=as.matrix(N$pred)
              d=prob(x=p,yhat=as.matrix(N$yhat),ytrue=M$y[[M$factor_name]])
              
              # predictions
              if (M$pred_method=='max_yhat') {
                  pred=apply(p,MARGIN=1,FUN=which.max)
              } else if (M$pred_method=='max_prob') {
                  pred=apply(d$ingroup,MARGIN=1,FUN=which.max)
              }
              pred=factor(pred,levels=1:nlevels(SM[[M$factor_name]]),labels=levels(SM[[M$factor_name]])) # make sure pred has all the levels of y
              q=data.frame("pred"=pred)
              output_value(M,'pred')=q
              return(M)
          }
)
prob=function(x,yhat,ytrue)
{
    # x is predicted values
    # yhat is training model
    # ytrue are real group labels
    ytrue=as.factor(ytrue)
    L=levels(ytrue)
    
    din=dout=x*0
    d=list()
    threshold=numeric(length(L))
    for (i in 1:length(L))
    {
        ingroup=yhat[ytrue==L[i],i]
        m1=mean(ingroup)
        s1=max(c(sd(ingroup),1e-5)) # make sure sd is not zero
        din[,i]=dnorm(x[,i,drop=FALSE],m1,s1)
        
        outgroup=yhat[ytrue!=L[i],i]
        m2=mean(outgroup)
        s2=max(c(sd(outgroup),1e-5)) # make sure sd is not 0
        dout[,i]=dnorm(x[,i,drop=FALSE],m2,s2)
        
        # threshold where distributions cross
        t=gauss_intersect(m1,m2,s1,s2)
        
        if (is.complex(t)) {
            # get the real values but only if the imaginary part is small
            w=which(abs(Im(t)) < 1e-6)
            if (length(w)==0){
                t=0 # all imaginary parts too large, so default to 0
            }
            t=Re(t[w])
        }
        
        if (length(t)>1) {
            # multiple cross over points so choose the one closest to 0
            t=t[which.min(abs(t))]
        }
        
        if (length(t)==0 ) {
            # length is zero. how does this happen? default to 0.
            t=0
        }
        
        if (is.na(t)) {
            # if polyroot failed return 0
            t=0
        }
        
        
        threshold[i]=t
    }
    d$ingroup=din/(din+dout) # assume probabilities sum to 1
    d$outgroup=dout/(din+dout) # assume probabilities sum to 1
    # (has to belong to in or outgroup)
    d$ingroup[is.nan(d$ingroup)]=0
    d$outgroup[is.nan(d$outgroup)]=0
    d$threshold=threshold
    return(d)
}
gauss_intersect=function(m1,m2,s1,s2) {
    #https://stackoverflow.com/questions/22579434/python-finding-the-intersection-point-of-two-gaussian-curves
    a=(1/(2*s1*s1))-(1/(2*s2*s2))
    b=(m2/(s2*s2)) - (m1/(s1*s1))
    c=((m1*m1) / (2*s1*s1)) - ((m2*m2)/(2*s2*s2)) - log(s2/s1)
    t=tryCatch({
        g=polyroot(c(c,b,a))
        return(g)
    },warning=function(w) {
        g = NA # polyroot unreliable so return NA
        return(g)
    }, error=function(e) {
        g = NA # polyroot failed so return NA
        return(g)
    }
    )
    
    return() # in reverse order vs numpy.roots
}
set_scale <- function(y=NULL,name='PCA',...){
    
    #library(scales)
    pal=c("#386cb0","#ef3b2c","#7fc97f","#fdb462","#984ea3","#a6cee3","#778899","#fb9a99","#ffff33") #  default palette
    if (name=='PCA') {
        w=which(levels(y)=='QC') # NB returns length 0 if y is not a factor, so default colour palette
        if (length(w)!=0)
        {
            # there are QCs so add black
            pal=c('#000000',pal)
        }
    }
    discrete_scale(c("colour","fill"),"Publication",manual_pal(values = pal), drop=FALSE, name=NULL,...) # sets both fill and colour aesthetics to chosen palette.
}
Add the following code to your website.
For more information on customizing the embed code, read Embedding Snippets.