time = proc.time()
n = 1000
l=vector(mode = 'numeric',length = n)
d=vector(mode = 'numeric',length = n)
for(i in 1:n){
s = sim.tree(ct=10)
l[i] = llik(pars = c(0.8,0.1,40),tree = s$tree)
d[i] = length(s$tree$wt)
}
qplot(d, geom='histogram')
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.
sort(table(d),decreasing=TRUE)[1]
## 76
## 36
get.time(time)
## [1] 157.95
qplot(d, geom='histogram',binwidth=1)
dens = density(d)
plot(dens)
kerneldim = function(d,dens){
x=dens$x
de = dens$y[which(abs(x-d)==min(abs(x-d)))]
return(de)
}
DENS = vector(mode='numeric',length = n)
for(i in 1:n){
DENS[i] = kerneldim(d = d[i],dens = dens)
}
## Warning in DENS[i] <- kerneldim(d = d[i], dens = dens): number of items to
## replace is not a multiple of replacement length
## Warning in DENS[i] <- kerneldim(d = d[i], dens = dens): number of items to
## replace is not a multiple of replacement length
## Warning in DENS[i] <- kerneldim(d = d[i], dens = dens): number of items to
## replace is not a multiple of replacement length
## Warning in DENS[i] <- kerneldim(d = d[i], dens = dens): number of items to
## replace is not a multiple of replacement length
## Warning in DENS[i] <- kerneldim(d = d[i], dens = dens): number of items to
## replace is not a multiple of replacement length
## Warning in DENS[i] <- kerneldim(d = d[i], dens = dens): number of items to
## replace is not a multiple of replacement length
## Warning in DENS[i] <- kerneldim(d = d[i], dens = dens): number of items to
## replace is not a multiple of replacement length
qplot(d,l)
qplot(d,log(DENS))
llik2 = function(pars,tree){
b = c(pars[1],(pars[1]-pars[2])/pars[3],pars[2])
ct = sum(tree$wt)
t = tree$wt[1:(length(tree$wt)-1)]
lastn = tree$n[length(tree$n)]
n = tree$n[1:(length(tree$n)-1)]
E = tree$E
sigma = n*(b[1]-b[2]*n + b[3]) #n-dimentional
rho = pmax(b[1]*E-b[2]*n*E+b[3]*(1-E),0)
#if(sum)
# l = -sum(-sigma*t+log(rho))
l = list(sigT=sum(-sigma*t),rho=sum(log(rho)),llik=sum(-sigma*t+log(rho)))
if(min(b)<0){l = Inf}
return(l)
}
n = 1000
l=vector(mode = 'numeric',length = n)
ls=vector(mode = 'numeric',length = n)
lr=vector(mode = 'numeric',length = n)
d=vector(mode = 'numeric',length = n)
for(i in 1:n){
s = sim.tree(ct=10)
l2 = llik2(pars = c(0.8,0.1,40),tree = s$tree)
l[i] = l2$llik
ls[i] = l2$sigT
lr[i] = l2$rho
d[i] = length(s$tree$wt)
}
qplot(d,l)
qplot(d,ls)
qplot(d,lr)
time = proc.time()
n = 10000
l=vector(mode = 'numeric',length = n)
d=vector(mode = 'numeric',length = n)
for(i in 1:n){
s = sim.tree(ct=10)
l[i] = llik(pars = c(0.8,0.1,40),tree = s$tree)
d[i] = length(s$tree$wt)
}
qplot(d, geom='histogram')
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.
sort(table(d),decreasing=TRUE)[1]
## 77
## 300
get.time(time)
## [1] 1617.716
qplot(d, geom='histogram',binwidth=1)
time = proc.time()
n = 50000
l=vector(mode = 'numeric',length = n)
d=vector(mode = 'numeric',length = n)
for(i in 1:n){
s = sim.tree(ct=10)
d[i] = length(s$tree$wt)
}
qplot(d, geom='histogram')
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.
sort(table(d),decreasing=TRUE)[1]
## 76
## 1388
get.time(time)
## [1] 9014.206
qplot(d, geom='histogram',binwidth=1)
time = proc.time()
n = 5000
l=vector(mode = 'numeric',length = n)
d=vector(mode = 'numeric',length = n)
for(i in 1:n){
s = sim.tree(ct=10,mu0=0.4)
d[i] = length(s$tree$wt)
}
qplot(d, geom='histogram')
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.
sort(table(d),decreasing=TRUE)[1]
## 108
## 45
get.time(time)
## [1] 1044.651
sort(table(d),decreasing=TRUE)[1:5]
## d
## 108 113 85 109 115
## 45 44 43 41 41
qplot(d, geom='histogram',binwidth=1)
preparando pal experiment
time = proc.time()
n = 5000
l=vector(mode = 'numeric',length = n)
d=vector(mode = 'numeric',length = n)
for(i in 1:n){
s = sim.tree(ct=15,mu0=0.4)
d[i] = length(s$tree$wt)
}
qplot(d, geom='histogram')
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.
sort(table(d),decreasing=TRUE)[1]
## 282
## 37
get.time(time)
## [1] 2053.188
sort(table(d),decreasing=TRUE)[1:5]
## d
## 282 223 293 287 228
## 37 36 35 34 32
qplot(d, geom='histogram',binwidth=1)
time = proc.time()
n = 10000
l=vector(mode = 'numeric',length = n)
d=vector(mode = 'numeric',length = n)
for(i in 1:n){
s = sim.tree(ct=15,mu0=0.4)
d[i] = length(s$tree$wt)
}
qplot(d, geom='histogram',binwidth=1)
sort(table(d),decreasing=TRUE)[1]
## 282
## 78
get.time(time)
## [1] 4334.513
sort(table(d),decreasing=TRUE)[1:5]
## d
## 282 240 249 285 284
## 78 64 64 61 60
time = proc.time()
n = 50000
l=vector(mode = 'numeric',length = n)
d=vector(mode = 'numeric',length = n)
S=vector(mode = 'list',length = n)
for(i in 1:n){
s = sim.tree(ct=15,mu0=0.4)
d[i] = length(s$tree$wt)
S[[i]] = s
}
qplot(d, geom='histogram',binwidth=1)
sort(table(d),decreasing=TRUE)[1]
## 258
## 268
get.time(time)
## [1] 17317.61
sort(table(d),decreasing=TRUE)[1:5]
## d
## 258 280 254 264 267
## 268 267 263 259 258
m=vector(mode = 'numeric',length = n)
extant=vector(mode = 'numeric',length = n)
for(i in 1:n){
s = S[[i]]
m[i] = count.missing(s)
extant[i] = length(s$tree.extant$wt)
}
qplot(extant,d)
qplot(extant,m)
ahora experimento hgitli
dim =
for(i in 1:1000){
s = sim.tree(ct=15)
}
n = 1000
l=vector(mode = 'numeric',length = n)
d=vector(mode = 'numeric',length = n)
alpha = vector(mode = 'numeric',length = n)
beta = vector(mode = 'numeric',length = n)
alpha2 = vector(mode = 'numeric',length = n)
beta2 = vector(mode = 'numeric',length = n)
he = vector(mode = 'numeric',length = n)
for(i in 1:n){
s = sim.tree(ct=5)
l[i] = llik(pars = c(0.8,0.1,40),tree = s$tree)
d[i] = length(s$tree$wt)
alpha[i] = (sum(1/s$sigmas)^2)/sum(1/s$sigmas^2)
beta[i] = sum(1/s$sigmas)/sum(1/s$sigmas^2)
alpha2[i] = d[i]
beta2[i] = d[i]/sum(1/s$sigmas)
he[i] = dhypoexp(5,rate=s$sigmas,log=TRUE)
}
qplot(d,l)
lm = lm(l~d)
summary(lm)$coefficients
log(5)
qplot(d,l-lm$coefficients[2]*d)
qplot(d,l-he)
qplot(d,l-lm$coefficients[2]*alpha)
qplot(d,l-dgamma(5,alpha,beta,log = TRUE))
qplot(d,l-dgamma(5,alpha,beta2,log = TRUE))
qplot(alpha,alpha2)
qplot(d,alpha)
qplot(d,alpha2)
time = proc.time()
n = 10000
l=vector(mode = 'numeric',length = n)
d=vector(mode = 'numeric',length = n)
alpha = vector(mode = 'numeric',length = n)
beta = vector(mode = 'numeric',length = n)
alpha2 = vector(mode = 'numeric',length = n)
beta2 = vector(mode = 'numeric',length = n)
lambdas = vector(mode = 'numeric',length = n)
for(i in 1:n){
s = sim.tree(ct=10)
l[i] = llik(pars = c(0.8,0.1,40),tree = s$tree)
d[i] = length(s$tree$wt)
alpha[i] = (sum(1/s$sigmas)^2)/sum(1/s$sigmas^2)
beta[i] = sum(1/s$sigmas)/sum(1/s$sigmas^2)
alpha2[i] = d[i]
beta2[i] = d[i]/sum(1/s$sigmas)
lambdas[i] = sum(s$sigmas*s$tree$wt)
}
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
qplot(d,l)
lm = lm(l~d)
summary(lm)$coefficients
## Estimate Std. Error t value Pr(>|t|)
## (Intercept) -20.10603 0.317938660 -63.2387 0
## d 2.56406 0.004406683 581.8571 0
log(10)
## [1] 2.302585
get.time(time)
## [1] 1624.038
qplot(d,l)
qplot(d,l + dgamma(10,shape=alpha,rate=beta,log = TRUE))
#qplot(d,l-lm$coefficients[2]*d)
#qplot(d,l-dgamma(10,shape=alpha,rate=beta,log = TRUE))
#qplot(d,l-dgamma(10,shape=alpha,rate=beta,log = TRUE)-dpois(10,lambda=lambdas,log=TRUE))
#qplot(d,l+dgamma(10,shape=alpha,rate=beta,log = TRUE)+dpois(10,lambda=lambdas,log=TRUE))
#qplot(d,l+dpois(10,lambda=lambdas,log=TRUE))
co=count(d)
cod = NULL
for(i in 1:length(d)){
cod = c(cod,co$freq[co$x==d[i]])
}
cod = cod/sum(cod)
qplot(d,lambdas)
qplot(d,-dpois(10,lambda=lambdas,log=TRUE))
qplot(d,-log(cod))
qplot(d,-dgamma(10,shape=alpha,rate=beta,log = TRUE))
qplot(d,l-dpois(10,lambda=lambdas,log=TRUE)-dgamma(10,shape=alpha,rate=beta,log = TRUE))
qplot(d,l-log(cod)-dgamma(10,shape=alpha,rate=beta,log = TRUE))
## \(ct=15\)
time = proc.time()
n = 10000
l=vector(mode = 'numeric',length = n)
d=vector(mode = 'numeric',length = n)
alpha = vector(mode = 'numeric',length = n)
beta = vector(mode = 'numeric',length = n)
alpha2 = vector(mode = 'numeric',length = n)
beta2 = vector(mode = 'numeric',length = n)
lambdas = vector(mode = 'numeric',length = n)
for(i in 1:n){
s = sim.tree(ct=15)
l[i] = llik(pars = c(0.8,0.1,40),tree = s$tree)
d[i] = length(s$tree$wt)
alpha[i] = (sum(1/s$sigmas)^2)/sum(1/s$sigmas^2)
beta[i] = sum(1/s$sigmas)/sum(1/s$sigmas^2)
alpha2[i] = d[i]
beta2[i] = d[i]/sum(1/s$sigmas)
lambdas[i] = sum(s$sigmas*s$tree$wt)
}
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
## Warning in s$sigmas * s$tree$wt: longer object length is not a multiple of
## shorter object length
qplot(d,l)
lm = lm(l~d)
summary(lm)$coefficients
## Estimate Std. Error t value Pr(>|t|)
## (Intercept) -15.350688 0.66912552 -22.94142 1.484854e-113
## d 2.740496 0.00590488 464.10693 0.000000e+00
log(15)
## [1] 2.70805
get.time(time)
## [1] 2213.867
qplot(d,l)
qplot(d,l-lm$coefficients[2]*d)
qplot(d,l-dgamma(15,shape=alpha,rate=beta,log = TRUE))
qplot(d,l-dgamma(15,shape=alpha,rate=beta,log = TRUE)-dpois(15,lambda=lambdas,log=TRUE))
qplot(d,l+dgamma(15,shape=alpha,rate=beta,log = TRUE)+dpois(15,lambda=lambdas,log=TRUE))
qplot(d,l+dpois(15,lambda=lambdas,log=TRUE))
qplot(d,dpois(15,lambda=lambdas,log=TRUE))
qplot(d,dgamma(15,shape=alpha,rate=beta,log = TRUE))
time = proc.time()
n = 100000
l=vector(mode = 'numeric',length = n)
d=vector(mode = 'numeric',length = n)
alpha = vector(mode = 'numeric',length = n)
beta = vector(mode = 'numeric',length = n)
alpha2 = vector(mode = 'numeric',length = n)
beta2 = vector(mode = 'numeric',length = n)
for(i in 1:n){
s = sim.tree(ct=10)
l[i] = llik(pars = c(0.8,0.1,40),tree = s$tree)
d[i] = length(s$tree$wt)
alpha[i] = (sum(1/s$sigmas)^2)/sum(1/s$sigmas^2)
beta[i] = sum(1/s$sigmas)/sum(1/s$sigmas^2)
alpha2[i] = d[i]
beta2[i] = d[i]/sum(1/s$sigmas)
}
qplot(d,l)
lm = lm(l~d)
summary(lm)$coefficients
## Estimate Std. Error t value Pr(>|t|)
## (Intercept) -20.251842 0.100675832 -201.1589 0
## d 2.567673 0.001392214 1844.3096 0
log(15)
## [1] 2.70805
get.time(time)
## [1] 15574.48
qplot(d,l-lm$coefficients[2]*d)
qplot(d,dgamma(15,shape=alpha,rate=beta,log = TRUE))
qplot(d,l-pgamma(15,shape=alpha,rate=beta,log = TRUE))
qplot(d,pgamma(15,shape=alpha,rate=beta,log = TRUE))
qplot(d,l-log(15)*(alpha-1))
qplot(d,l-log(15)*(alpha-1)+beta*15)
qplot(d,l-log(15)*(alpha-1)+beta*15-alpha*log(beta))
qplot(d,l-log(15)*(alpha-1)+beta*15-alpha*log(beta)+lgamma(alpha))
qplot(d,l-log(15)*(alpha-1)+beta*15-alpha*log(beta)-lgamma(alpha))
qplot(l-lm$coefficients[2]*d,l-log(15)*(alpha-1)+beta*15-alpha*log(beta))
qplot(d,log(gamma(alpha)))
qplot(d,l-dgamma(15,shape=alpha2,rate=beta2,log = TRUE))
qplot(alpha,alpha2)
qplot(d,alpha)
qplot(d,beta)
qplot(d,alpha2)
qplot(d,beta2)
time = proc.time()
n = 10000
l=vector(mode = 'numeric',length = n)
d=vector(mode = 'numeric',length = n)
alpha = vector(mode = 'numeric',length = n)
beta = vector(mode = 'numeric',length = n)
alpha2 = vector(mode = 'numeric',length = n)
beta2 = vector(mode = 'numeric',length = n)
for(i in 1:n){
s = sim.tree(ct=15)
l[i] = llik(pars = c(0.8,0.1,40),tree = s$tree)
d[i] = length(s$tree$wt)
alpha[i] = (sum(1/s$sigmas)^2)/sum(1/s$sigmas^2)
beta[i] = sum(1/s$sigmas)/sum(1/s$sigmas^2)
alpha2[i] = d[i]
beta2[i] = d[i]/sum(1/s$sigmas)
}
qplot(d,l)
lm = lm(l~d)
summary(lm)$coefficients
## Estimate Std. Error t value Pr(>|t|)
## (Intercept) -14.458147 0.674985370 -21.41994 1.472904e-99
## d 2.730395 0.005949888 458.89860 0.000000e+00
log(15)
## [1] 2.70805
get.time(time)
## [1] 2205.08
qplot(d,l-lm$coefficients[2]*d)
qplot(d,l-dgamma(15,shape=alpha,rate=beta,log = TRUE))
qplot(d,dgamma(15,shape=alpha,rate=beta,log = TRUE))
qplot(d,l-pgamma(15,shape=alpha,rate=beta,log = TRUE))
qplot(d,pgamma(15,shape=alpha,rate=beta,log = TRUE))
qplot(d,l-log(15)*(alpha-1))
qplot(d,l-log(15)*(alpha-1)+beta*15)
qplot(d,l-log(15)*(alpha-1)+beta*15-alpha*log(beta))
qplot(d,l-log(15)*(alpha-1)+beta*15-alpha*log(beta)+lgamma(alpha))
qplot(d,l-log(15)*(alpha-1)+beta*15-alpha*log(beta)-lgamma(alpha))
qplot(l-lm$coefficients[2]*d,l-log(15)*(alpha-1)+beta*15-alpha*log(beta))
qplot(d,log(gamma(alpha)))
qplot(d,l-dgamma(15,shape=alpha2,rate=beta2,log = TRUE))
qplot(alpha,alpha2)
qplot(d,alpha)
qplot(d,beta)
qplot(d,alpha2)
qplot(d,beta2)
\(ct = 20\)
n = 10000
l=vector(mode = 'numeric',length = n)
d=vector(mode = 'numeric',length = n)
alpha = vector(mode = 'numeric',length = n)
beta = vector(mode = 'numeric',length = n)
alpha2 = vector(mode = 'numeric',length = n)
beta2 = vector(mode = 'numeric',length = n)
for(i in 1:n){
s = sim.tree(ct=20)
l[i] = llik(pars = c(0.8,0.1,40),tree = s$tree)
d[i] = length(s$tree$wt)
alpha[i] = (sum(1/s$sigmas)^2)/sum(1/s$sigmas^2)
beta[i] = sum(1/s$sigmas)/sum(1/s$sigmas^2)
alpha2[i] = d[i]
beta2[i] = d[i]/sum(1/s$sigmas)
}
qplot(d,l)
lm = lm(l~d)
summary(lm)$coefficients
## Estimate Std. Error t value Pr(>|t|)
## (Intercept) 17.303881 0.946985381 18.2726 2.125712e-73
## d 2.658394 0.006182239 430.0051 0.000000e+00
log(20)
## [1] 2.995732
qplot(d,l-lm$coefficients[2]*d)
qplot(d,l-dgamma(20,shape=alpha,rate=beta,log = TRUE))
qplot(d,dgamma(20,shape=alpha,rate=beta,log = TRUE))
qplot(d,pgamma(20,shape=alpha,rate=beta,log = TRUE))
qplot(d,pgamma(20,shape=alpha,rate=beta))
qplot(d,dgamma(20,shape=alpha,rate=beta))
qplot(d,dgamma(20,alpha,beta))
qplot(alpha)
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.
qplot(d,l-log(20)*(alpha-1))
qplot(d,log(20)*(alpha-1))
qplot(d,l-log(20)*(alpha-1)+beta*20)
qplot(d,l-log(20)*(alpha-1)+beta*20-alpha*log(beta))
qplot(d,l-log(20)*(alpha-1)+beta*20-alpha*log(beta)+lgamma(alpha))
qplot(d,l-log(20)*(alpha-1)+beta*20-alpha*log(beta)-lgamma(alpha))
qplot(l-lm$coefficients[2]*d,l-log(20)*(alpha-1)+beta*20-alpha*log(beta))
qplot(d,log(gamma(alpha)))
qplot(d,l-dgamma(20,shape=alpha2,rate=beta2,log = TRUE))
qplot(alpha,alpha2)
qplot(d,alpha)
qplot(d,beta)
qplot(d,alpha2)
qplot(d,beta2)
lo mismo pero muchos mas puntos
n = 50000
l=vector(mode = 'numeric',length = n)
d=vector(mode = 'numeric',length = n)
alpha = vector(mode = 'numeric',length = n)
beta = vector(mode = 'numeric',length = n)
alpha2 = vector(mode = 'numeric',length = n)
beta2 = vector(mode = 'numeric',length = n)
for(i in 1:n){
s = sim.tree(ct=20)
l[i] = llik(pars = c(0.8,0.1,40),tree = s$tree)
d[i] = length(s$tree$wt)
alpha[i] = (sum(1/s$sigmas)^2)/sum(1/s$sigmas^2)
beta[i] = sum(1/s$sigmas)/sum(1/s$sigmas^2)
alpha2[i] = d[i]
beta2[i] = d[i]/sum(1/s$sigmas)
}
qplot(d,l)
lm = lm(l~d)
summary(lm)$coefficients
## Estimate Std. Error t value Pr(>|t|)
## (Intercept) 16.618559 0.421060220 39.46837 0
## d 2.663636 0.002748841 969.00306 0
log(20)
## [1] 2.995732
qplot(d,l-lm$coefficients[2]*d)
qplot(d,l-dgamma(20,shape=alpha,rate=beta,log = TRUE))
qplot(d,dgamma(20,shape=alpha,rate=beta,log = TRUE))
qplot(d,dgamma(20,shape=alpha,rate=beta))
qplot(d,dgamma(20,alpha,beta))
qplot(alpha)
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.
qplot(d,l-log(20)*(alpha-1))
qplot(d,log(20)*(alpha-1))
qplot(d,l-log(20)*(alpha-1)+beta*20)
qplot(d,l-log(20)*(alpha-1)+beta*20-alpha*log(beta))
qplot(d,l-log(20)*(alpha-1)+beta*20-alpha*log(beta)+lgamma(alpha))
qplot(d,l-log(20)*(alpha-1)+beta*20-alpha*log(beta)-lgamma(alpha))
qplot(dgamma(20,shape=alpha,rate=beta,log = TRUE),log(20)*(alpha-1)+beta*20-alpha*log(beta)+lgamma(alpha))
qplot(l-lm$coefficients[2]*d,l-log(20)*(alpha-1)+beta*20-alpha*log(beta))
qplot(d,log(gamma(alpha)))
qplot(d,l-dgamma(20,shape=alpha2,rate=beta2,log = TRUE))
qplot(alpha,alpha2)
qplot(d,alpha)
qplot(d,beta)
qplot(d,alpha2)
qplot(d,beta2)
n = 1000
l=vector(mode = 'numeric',length = n)
d=vector(mode = 'numeric',length = n)
for(i in 1:n){
s = sim.tree(ct=15,lambda0 = 1.6)
l[i] = llik(pars = c(0.8,0.1,40),tree = s$tree)
d[i] = length(s$tree$wt)
}
qplot(d,l)
lm = lm(l~d)
summary(lm)$coefficients
## Estimate Std. Error t value Pr(>|t|)
## (Intercept) 35.899103 2.06646162 17.37226 2.887049e-59
## d 2.361533 0.01492517 158.22483 0.000000e+00
log(15)
## [1] 2.70805
n = 1000
l=vector(mode = 'numeric',length = n)
d=vector(mode = 'numeric',length = n)
for(i in 1:n){
s = sim.tree(ct=15,mu0 = 0.4)
l[i] = llik(pars = c(0.8,0.1,40),tree = s$tree)
d[i] = length(s$tree$wt)
}
qplot(d,l)
#lm = lm(l~d)
#summary(lm)$coefficients
log(15)
## [1] 2.70805