Nothing
makenetwork <-
function(costL,costR,ncontrols=1,controlcosts=NULL){
stopifnot(is.matrix(costR))
stopifnot(is.matrix(costL))
stopifnot((dim(costR)[1])==(dim(costL)[1]))
stopifnot((dim(costR)[2])==(dim(costL)[2]))
stopifnot(is.vector(ncontrols)&(length(ncontrols==1))&(ncontrols>=1))
stopifnot(ncontrols==round(ncontrols))
if (!is.null(controlcosts)) {
stopifnot((dim(costR)[2])==length(controlcosts))
stopifnot(all(controlcosts>=0))
}
else controlcosts<-rep(0,dim(costR)[2])
stopifnot(all(rownames(costR)==rownames(costL)))
stopifnot(all(colnames(costR)==colnames(costL)))
ntreated<-dim(costR)[1]
ncontrol<-dim(costR)[2]
treated<-1:ntreated
control<-(ntreated+1):(ntreated+ncontrol)
idtreated<-rownames(costR)
idcontrol<-colnames(costR)
startn<-rep(treated,ncontrol)
endn<-as.vector(t(matrix(rep(control,ntreated),ncontrol,ntreated)))
cost<-as.vector(costL)
cc<-(ntreated+ncontrol+1):(ntreated+2*ncontrol) # duplicate control edges
startn<-c(startn,control)
endn<-c(endn,cc)
cost<-c(cost,controlcosts)
startn<-c(startn,as.vector(t(matrix(rep(cc,ntreated),ncontrol,ntreated))))
tt<-(1+ntreated+2*ncontrol):(2*(ntreated+ncontrol)) # duplicate treated
endn<-c(endn,rep(tt,ncontrol))
cost<-c(cost,as.vector(costR))
ucap<-rep(1,length(startn))
b<-c(rep(ncontrols,ntreated),rep(0,2*ncontrol),rep(-ncontrols,ntreated))
net=list(startn=startn,endn=endn,ucap=ucap,cost=cost,b=b)
list(idtreated=idtreated,idcontrol=idcontrol,net=net)
}
Any scripts or data that you put into this service are public.
Add the following code to your website.
For more information on customizing the embed code, read Embedding Snippets.