R/plmr.R

Defines functions rcModelWPLMrc rcModelWPLMrr rcModelWPLMr rcModelPLMrc rcModelPLMrr rcModelPLMr

Documented in rcModelPLMr rcModelPLMrc rcModelPLMrr rcModelWPLMr rcModelWPLMrc rcModelWPLMrr

rcModelPLMr <- function(y){
  if (!is.matrix(y))
    stop("argument should be matrix")
  PsiCode <- 0
  PsiK <- 1.345
  .Call("R_plmr_model",y,PsiCode,PsiK,PACKAGE="preprocessCore")
}

rcModelPLMrr <- function(y){
  if (!is.matrix(y))
    stop("argument should be matrix")
  PsiCode <- 0
  PsiK <- 1.345
  .Call("R_plmrr_model",y,PsiCode,PsiK,PACKAGE="preprocessCore")
}


rcModelPLMrc <- function(y){
  if (!is.matrix(y))
    stop("argument should be matrix")
  PsiCode <- 0
  PsiK <- 1.345
  .Call("R_plmrc_model",y,PsiCode,PsiK,PACKAGE="preprocessCore")
}





rcModelWPLMr <- function(y, w){
  if (!is.matrix(y))
    stop("argument should be matrix")
  if (is.vector(w)){
    if (length(w) != prod(dim(y))){
      stop("weights are not correct length")
    }
  } else if (is.matrix(w)){
    if (!all(dim(w) == dim(y))){
      stop("weights should be same dimension as input matrix")
    }

  }
  if (any(w < 0)){
    stop("weights should be non negative")
  }

  
    
  PsiCode <- 0
  PsiK <- 1.345
  .Call("R_wplmr_model",y,PsiCode,PsiK,as.double(w),PACKAGE="preprocessCore")

}


rcModelWPLMrr <- function(y, w){
  if (!is.matrix(y))
    stop("argument should be matrix")
  if (is.vector(w)){
    if (length(w) != prod(dim(y))){
      stop("weights are not correct length")
    }
  } else if (is.matrix(w)){
    if (!all(dim(w) == dim(y))){
      stop("weights should be same dimension as input matrix")
    }

  }
  if (any(w < 0)){
    stop("weights should be non negative")
  }

  
    
  PsiCode <- 0
  PsiK <- 1.345
  .Call("R_wplmrr_model",y,PsiCode,PsiK,as.double(w),PACKAGE="preprocessCore")

}


rcModelWPLMrc <- function(y, w){
  if (!is.matrix(y))
    stop("argument should be matrix")
  if (is.vector(w)){
    if (length(w) != prod(dim(y))){
      stop("weights are not correct length")
    }
  } else if (is.matrix(w)){
    if (!all(dim(w) == dim(y))){
      stop("weights should be same dimension as input matrix")
    }

  }
  if (any(w < 0)){
    stop("weights should be non negative")
  }

  
    
  PsiCode <- 0
  PsiK <- 1.345
  .Call("R_wplmrc_model",y,PsiCode,PsiK,as.double(w),PACKAGE="preprocessCore")

}

Try the preprocessCore package in your browser

Any scripts or data that you put into this service are public.

preprocessCore documentation built on Jan. 10, 2021, 2:01 a.m.