R/qcom_sub.R

qcom.sub <- function(x, y, q, alpha=.05, nboot=2000, SEED=TRUE){
  
  x<-x[!is.na(x)] # Remove any missing values in x
  y<-y[!is.na(y)] # Remove any missing values in y
  if(SEED)set.seed(2) # set seed of random number generator so that
  #             results can be duplicated.
  datax<-matrix(sample(x,size=length(x)*nboot,replace=TRUE),nrow=nboot)
  datay<-matrix(sample(y,size=length(y)*nboot,replace=TRUE),nrow=nboot)
  datax=listm(t(datax))
  datay=listm(t(datay))
  bvecx<-mclapply(datax,hd,q,mc.preschedule=TRUE)
  bvecy<-mclapply(datay,hd,q,mc.preschedule=TRUE)
  bvecx=as.vector(matl(bvecx))
  bvecy=as.vector(matl(bvecy))
  bvec<-sort(bvecx-bvecy)
  low<-round((alpha/2)*nboot)+1
  up<-nboot-low
  temp<-sum(bvec<0)/nboot+sum(bvec==0)/(2*nboot)
  sig.level<-2*(min(temp,1-temp))
  se<-var(bvec)
  list(est.1=hd(x,q),est.2=hd(y,q),ci=c(bvec[low],bvec[up]),p.value=sig.level,sq.se=se,n1=length(x),n2=length(y))
}
musto101/wilcox_R documentation built on May 23, 2019, 10:52 a.m.