1 The lettuce dataset

In a previous tutorial, we analysed the dataset on lettuce plants with ANOVA. However, it was not clear if all the assumptions of ANOVA were met. Indeed, with only 7 datapoints per group, it is very hard to assess the assumptions of normality and equal variances.

Therefore, we will re-analyse the dataset by using the non-parametric alternative to ANOVA, the Kruskal-Wallis test, which is the right thing to do if we the assumptions are not met.

We will first give a concise overview of what we saw in the ANOVA analysis, which can be found in the “ANOVA_lettuce_plants.Rmd” file.

The researchers want to find out if biochar, compost and a combination of both biochar and compost have an influence on the growth of lettuce plants. To this end, they grew up lettuce plants in a greenhouse. The pots were filled with one of four soil types;

  1. Soil only (control)
  2. Soil supplemented with biochar (refoak)
  3. Soil supplemented with compost (compost)
  4. Soil supplemented with both biochar and compost (cobc)

The dataset freshweight_lettuce.txt contains the freshweight (in grams) for 28 lettuce plants (7 per condition). The researchers want to use an ANOVA test to find out whether or not there is an effect of one or more of the treatments on the growth of lettuce plants. If so, they will use a post-hoc test (Tuckey test) to find which specific treatments have an effect.

Load the required libraries

library(tidyverse)
library(car)
library(coin)

2 Data import

lettuce <- read_csv("https://raw.githubusercontent.com/GTPB/PSLS20/master/data/freshweight_lettuce.txt")
## Take a glimpse at the data
glimpse(lettuce)
## Observations: 28
## Variables: 3
## $ id          <dbl> 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17…
## $ treatment   <chr> "control", "control", "control", "control", "control", "c…
## $ freshweight <dbl> 38, 34, 41, 43, 43, 29, 38, 59, 64, 57, 56, 50, 64, 62, 3…
## treatment to factor
lettuce$treatment <- as.factor(as.character(lettuce$treatment))

3 Data exploration

## Count the number of observations per treatment
table(lettuce$treatment)
## 
##    cobc compost control  refoak 
##       7       7       7       7

Now let’s make a boxplot displaying the freshweight of each treatment condition:

lettuce %>%
  ggplot(aes(x=treatment,y=freshweight,fill=treatment)) + 
  scale_fill_brewer(palette="RdGy") +
  theme_bw() +
  geom_boxplot(outlier.shape=NA) + 
  geom_jitter(width = 0.2) +
  ggtitle("Boxplot of the freshweigth for each treatment condition") +
  ylab("freshweight (gram)") + 
  stat_summary(fun.y=mean, geom="point", shape=5, size=3, color="black", fill="black")

Note that there are no clear outliers in the data. We can see that the mean fresweight is very comparable between the control and refoak treatments and between the compost and cobc treatments. We can also see that the mean freshweight is much higher in the cobc and control treatments than in the control and refoak treatments. But is this observed difference significant?

3.1 Checking the assumptions of ANOVA

To study whether or not the observed difference between the average freshweight values of the differentt treatment groups are significant, we may perform an ANOVA.

The null hypothesis of ANOVA states that: The mean freshweigth is equal between the different treatment groups.

The alternative hypothesis of ANOVA states that: The mean freshweigth for at least one treatment group is different than the mean freshweight in at least one other treatment group.

Before we may proceed with the analysis, we must make sure that all assumptions for ANOVA are met. ANOVA has three assumptions:

  1. The observations are independent of each other (in all groups)
  2. The data (freshweigth) must be normally distributed (in all groups)
  3. The variability within all groups is similar

3.1.1 Assumption of independence

The first assumption is met; we started of with 28 lettuce plants and we randomly submitted them to one of four treatment conditions. There is no reason to believe that the plants display systematic differences between ttreatment groups, other than the actual treatment.

3.1.2 Assumption of normality

For the second assumption, we must check normality in each group.

## get qqplots for each individual treatment group
par(mfrow = c(2,2))
for(i in levels(lettuce$treatment)){
  qqPlot(subset(lettuce,treatment == i)$freshweight, main = i, ylab = "")
}

While in the “ANOVA_lettuce_plants.Rmd” file we accepted the assumption of normality, it must be noted that it is tricky to assess the assumption with only 7 datapoints. See “ANOVA_lettuce_plants.Rmd” for more details on this.

Let’s say that here we decide not to assume normality.

3.1.3 Assumption of equal variances

We can check the assumption of equal variance with a boxplot:

lettuce %>%
  ggplot(aes(x=treatment,y=freshweight,fill=treatment)) + 
  scale_fill_brewer(palette="RdGy") +
  theme_bw() +
  geom_boxplot(outlier.shape=NA) + 
  geom_jitter(width = 0.2) +
  ggtitle("Boxplot of the freshweigth for each treatment condition") +
  ylab("freshweight (gram)") + 
  stat_summary(fun.y=mean, geom="point", shape=5, size=3, color="black", fill="black")

As a measure of variability, we may take the height of each boxplot’s box. This is the interval between the 25% and 75% quantile. Here we can see that this interval, as well as the length of the whiskers, is approximately equal for most groups. However, the variability of cobc does seem to be quite a bit larger than the variability in the refoak group.

While we accepted the assumption of equal variances in the “ANOVA_lettuce_plants.Rmd” file, we will here reject the assumption.

Not all assumptions for ANOVA are met. As such, we will rely on the non-paramettric alternative of ANOVA: the Kruskal-Wallis test.

4 Analysis

4.1 Kruskal-Wallis rank test

If we want to test for a difference in the median of the different treatment groups, we have to ** assume a location shift **, saying that all treatment groups follow the same distribution, but with a different median.

However, here, we might be ** not prepared for taking this assumption **. While the range and spread of the data is similar for most groups (see boxplot), there is a quite a big difference between the IQR of the refoak and cobc conditions.

When we reject the assuming tthe location shift, we can relax the distributional assumptions even further and perform a test in terms of probabilistic indices (see the “Non_parametric_shrimps.Rmd” file).

With this Kruskal-Wallis test, we will test whether or not the chance that a random value of one treatment group is larger than or equal to (“\(\geq\)”) a random value of another treatment group is significantly different from 50%.

4.1.1 Hypotheses

  • Null hypothesis: \(H0\): The distribution of freshweights of lettuce plants are equal for all treatment conditions.

  • Alternative hypothesis: \(HA\): The chance that a random value of at least one treatment group is larger than or equal to (“\(\geq\)”) a random value of at least one other treatment group is significantly different from 50%.

4.1.2 test

set.seed(1)
kwPerm <- kruskal_test(freshweight~treatment,lettuce,
                       distribution=approximate(nresample=100000))
kwPerm
## 
##  Approximative Kruskal-Wallis Test
## 
## data:  freshweight by
##   treatment (cobc, compost, control, refoak)
## chi-squared = 20.715, p-value < 1e-05

Note that here we are comparing the observed test statistic (chi-squared = 20.715) with the test statistics derived from an empirical distribution that was generated by taking 10.000 permutations of the original lettuce dataset.

We find an extremly significant (p < 1e-05) of the treatment on the freshweight. On the 5% global significance level, we may state that the chance that a random value of at least one treatment group is larger than or equal to (“\(\geq\)”) a random value of at least one other treatment group is significantly different from 50%.

Now, we will perform a post-hoc analysis to find out which specific groups are different from each other.

4.2 Post-hoc analysis

We will perform a post-hoc analysis with pairwise Wilcoxon rank sum test. As we did not want to assume the location shift, we will interpret the outcome in terms of probabilistic indices. Note that after the analysis, we will need to correct the acquired p-values for multiple testing.

For each pairwise test, we have the following hypotheses:

  • Null hopothesis: \(H0\): The distribution of freshweights of lettuce plants are equal for both treatment conditions.

  • Alternative hypothesis: \(HA\): The chance that a random value of treatment group 1 is larger than or equal to (“\(\geq\)”) a random value of treatment group 2 is significantly different from 50%.

## initial attempt to perform the analysis
pairwise.wilcox.test(lettuce$freshweight,lettuce$treatment)
## Warning in wilcox.test.default(xi, xj, paired = paired, ...): cannot compute
## exact p-value with ties

## Warning in wilcox.test.default(xi, xj, paired = paired, ...): cannot compute
## exact p-value with ties

## Warning in wilcox.test.default(xi, xj, paired = paired, ...): cannot compute
## exact p-value with ties

## Warning in wilcox.test.default(xi, xj, paired = paired, ...): cannot compute
## exact p-value with ties

## Warning in wilcox.test.default(xi, xj, paired = paired, ...): cannot compute
## exact p-value with ties

## Warning in wilcox.test.default(xi, xj, paired = paired, ...): cannot compute
## exact p-value with ties
## 
##  Pairwise comparisons using Wilcoxon rank sum test 
## 
## data:  lettuce$freshweight and lettuce$treatment 
## 
##         cobc  compost control
## compost 0.400 -       -      
## control 0.013 0.013   -      
## refoak  0.013 0.013   0.400  
## 
## P value adjustment method: holm

We get the following warning message: cannot compute exact p-value with ties.

This is because the pairwise.wilcox.test() use the standard wilcox.test() function. In the help file of this function (?wilcox.test), we can read that in the presence of ties in the data, the function will perform a asymptotic test rather than an exact test.

If we do want to obtain exact p-values, we may use the wilcox_test() function from the coin package for each pairwise combination of treatments. The obtained p-values must be corrected for multiple testing, e.g. with the p.adjust() function.

## caluclate the p-value for each treatment combination with wilcoxon_test
treatments <- levels(lettuce$treatment)
freshweight <- lettuce$freshweight

pvalues <- combn(treatments,2,function(x){
  
  ## Pairwise Wilcon test
  test = wilcox_test(freshweight~treatment,subset(lettuce,treatment%in%x), distribution = 'exact')
  
  ## Get and store p-value of test
  pvalue(test)
})

## Adjust for multiple testing
pvalues_holm = p.adjust(pvalues,method = 'holm') 

## link the p-value with the correct pairwise test
names(pvalues_holm) <- combn(levels(lettuce$treatment),2,paste,collapse="_VS_")
pvalues_holm
##    cobc_VS_compost    cobc_VS_control     cobc_VS_refoak compost_VS_control 
##        0.393939394        0.005244755        0.003496503        0.003496503 
##  compost_VS_refoak  control_VS_refoak 
##        0.003496503        0.405594406

The exact p-values do indeed deviate from those calculated with the pairwise.wilcox.test() function. We will proceed with the exact p-values.

Now we will compute the point estimation for the probabilistic index (for each pairwise comparison). Note that we already did this in the “Non_parametric_shrimps.Rmd” and “Non_parametric_NHANES.Rmd” file for a single comparison.

## Count the number of observations per group
nGroup <- table(lettuce$treatment)

## Compute the probabilistic index for each pairwise combination
treatments <- levels(lettuce$treatment)

probInd <- combn(treatments,2,function(x){
  ## Compute the U1 statistic
  U1 <- wilcox.test(freshweight~treatment,subset(lettuce,treatment%in%x))$statistic
  
  ## Compute the probabilistic index
  U1/prod(nGroup[x])
})
## Warning in wilcox.test.default(x = c(57, 49, 52, 43, 59, 61, 58), y = c(59, :
## cannot compute exact p-value with ties
## Warning in wilcox.test.default(x = c(57, 49, 52, 43, 59, 61, 58), y = c(38, :
## cannot compute exact p-value with ties
## Warning in wilcox.test.default(x = c(57, 49, 52, 43, 59, 61, 58), y = c(38, :
## cannot compute exact p-value with ties
## Warning in wilcox.test.default(x = c(59, 64, 57, 56, 50, 64, 62), y = c(38, :
## cannot compute exact p-value with ties
## Warning in wilcox.test.default(x = c(59, 64, 57, 56, 50, 64, 62), y = c(38, :
## cannot compute exact p-value with ties
## Warning in wilcox.test.default(x = c(38, 34, 41, 43, 43, 29, 38), y = c(38, :
## cannot compute exact p-value with ties
## link the probabilistic index with the correct pairwise test
names(probInd) <- combn(levels(lettuce$treatment),2,paste,collapse="_VS_")
probInd
##    cobc_VS_compost    cobc_VS_control     cobc_VS_refoak compost_VS_control 
##          0.2857143          0.9795918          1.0000000          1.0000000 
##  compost_VS_refoak  control_VS_refoak 
##          1.0000000          0.6428571

We again see the same warning message. Here, this is not a prblem, we are not interested in the p-values (which we already computed), we only care about the probabilistic indices, that are calculated from the U1 statistic. U1 is computed as the number of times an observation of group 1 is larger than or equal to an observation of group 2. This statistic is thus defined even in the case of ties.

5 Conclusion

We find an extremly significant (p < 1e-05) of the treatment on the freshweight. On the 5% global significance level, we may state that the chance that a random value of at least one treatment group is larger than or equal to (“\(\geq\)”) a random value of at least one other treatment group is significantly different from 50%.

For the post-hoc analysis:

  • We find a highly significant difference in the distributions between the compost treatment and the control treatment. The probability that the freshweigth of plants grown in compost soil is higher than or equal to (“\(\geq\)”) the freshweigth of plants grown in control soil is 100%. This is highly significantly different from 50% (adjusted p-value=0.003).

  • We find a highly significant difference in the distributions between the cobc treatment and the control treatment. The probability that the freshweigth of plants grown in compost soil is higher than or equal to (“\(\geq\)”) the freshweigth of plants grown in control soil is 98%. This is highly significantly different from 50% (adjusted p-value=0.005).

  • We find a highly significant difference in the distributions between the compost treatment and the refoak treatment. The probability that the freshweigth of plants grown in compost soil is higher than or equal to (“\(\geq\)”) the freshweigth of plants grown in control soil is 100%. This is highly significantly different from 50% (adjusted p-value=0.003).

  • We find a highly significant difference in the distributions between the cobc treatment and the refoak treatment. The probability that the freshweigth of plants grown in compost soil is higher than or equal to (“\(\geq\)”) the freshweigth of plants grown in control soil is 100%. This is highly significantly different from 50% (adjusted p-value=0.003).

For the other contrast, we do not enough find evidence to suggest significant differences between the treatment groups.

We may conclude that supplementing soil with compost or with both compost and biochar has a positive effect on the freshweigth of lettuce plants. Note that, qualitatively, these conclusion are exactly the same as with the ANOVA analysis of the dataset in the “ANOVA_lettuce_plants.Rmd” file.


LS0tCnRpdGxlOiAiVHV0b3JpYWwgOS4xOiBLcnVza2FsLVdhbGxpcyBpbiB0aGUgbGV0dHVjZSBkYXRhc2V0IiAgIApvdXRwdXQ6CiAgICBodG1sX2RvY3VtZW50OgogICAgICBjb2RlX2Rvd25sb2FkOiB0cnVlICAgIAogICAgICB0aGVtZTogY29zbW8KICAgICAgdG9jOiB0cnVlCiAgICAgIHRvY19mbG9hdDogdHJ1ZQogICAgICBoaWdobGlnaHQ6IHRhbmdvCiAgICAgIG51bWJlcl9zZWN0aW9uczogdHJ1ZQotLS0KCiMgVGhlIGxldHR1Y2UgZGF0YXNldAoKSW4gYSBwcmV2aW91cyB0dXRvcmlhbCwgd2UgYW5hbHlzZWQgdGhlIGRhdGFzZXQgb24KbGV0dHVjZSBwbGFudHMgd2l0aCBBTk9WQS4gSG93ZXZlciwgaXQgd2FzIG5vdCBjbGVhcgppZiBhbGwgdGhlIGFzc3VtcHRpb25zIG9mIEFOT1ZBIHdlcmUgbWV0LiBJbmRlZWQsIHdpdGgKb25seSA3IGRhdGFwb2ludHMgcGVyIGdyb3VwLCBpdCBpcyB2ZXJ5IGhhcmQgdG8gYXNzZXNzCnRoZSBhc3N1bXB0aW9ucyBvZiBub3JtYWxpdHkgYW5kIGVxdWFsIHZhcmlhbmNlcy4KClRoZXJlZm9yZSwgd2Ugd2lsbCByZS1hbmFseXNlIHRoZSBkYXRhc2V0IGJ5IHVzaW5nIHRoZQpub24tcGFyYW1ldHJpYyBhbHRlcm5hdGl2ZSB0byBBTk9WQSwgdGhlIEtydXNrYWwtV2FsbGlzIHRlc3QsCndoaWNoIGlzIHRoZSByaWdodCB0aGluZyB0byBkbyBpZiB3ZSB0aGUgYXNzdW1wdGlvbnMgYXJlIG5vdAptZXQuCgpXZSB3aWxsIGZpcnN0IGdpdmUgYSBjb25jaXNlIG92ZXJ2aWV3IG9mIHdoYXQgd2Ugc2F3IGluIHRoZQpBTk9WQSBhbmFseXNpcywgd2hpY2ggY2FuIGJlIGZvdW5kIGluIHRoZSAKIkFOT1ZBX2xldHR1Y2VfcGxhbnRzLlJtZCIgZmlsZS4KClRoZSByZXNlYXJjaGVycyB3YW50IHRvIGZpbmQgb3V0IGlmIGJpb2NoYXIsIGNvbXBvc3QgYW5kCmEgY29tYmluYXRpb24gb2YgYm90aCBiaW9jaGFyIGFuZCBjb21wb3N0IGhhdmUgYW4gaW5mbHVlbmNlCm9uIHRoZSBncm93dGggb2YgbGV0dHVjZSBwbGFudHMuIFRvIHRoaXMgZW5kLCB0aGV5IGdyZXcgdXAKbGV0dHVjZSBwbGFudHMgaW4gYSBncmVlbmhvdXNlLiBUaGUgcG90cyB3ZXJlIGZpbGxlZCB3aXRoCm9uZSBvZiBmb3VyIHNvaWwgdHlwZXM7CgoxLiBTb2lsIG9ubHkgKGNvbnRyb2wpCjIuIFNvaWwgc3VwcGxlbWVudGVkIHdpdGggYmlvY2hhciAocmVmb2FrKQozLiBTb2lsIHN1cHBsZW1lbnRlZCB3aXRoIGNvbXBvc3QgKGNvbXBvc3QpCjQuIFNvaWwgc3VwcGxlbWVudGVkIHdpdGggYm90aCBiaW9jaGFyIGFuZCBjb21wb3N0IChjb2JjKQoKVGhlIGRhdGFzZXQgYGZyZXNod2VpZ2h0X2xldHR1Y2UudHh0YCBjb250YWlucyB0aGUgZnJlc2h3ZWlnaHQKKGluIGdyYW1zKSBmb3IgMjggbGV0dHVjZSBwbGFudHMgKDcgcGVyIGNvbmRpdGlvbikuIFRoZSByZXNlYXJjaGVycwp3YW50IHRvIHVzZSBhbiBBTk9WQSB0ZXN0IHRvIGZpbmQgb3V0IHdoZXRoZXIgb3Igbm90IHRoZXJlIGlzIGFuCmVmZmVjdCBvZiBvbmUgb3IgbW9yZSBvZiB0aGUgdHJlYXRtZW50cyBvbiB0aGUgZ3Jvd3RoIG9mIGxldHR1Y2UgCnBsYW50cy4gSWYgc28sIHRoZXkgd2lsbCB1c2UgYSBwb3N0LWhvYyB0ZXN0IChUdWNrZXkgdGVzdCkgdG8gZmluZAp3aGljaCBzcGVjaWZpYyB0cmVhdG1lbnRzIGhhdmUgYW4gZWZmZWN0LgoKTG9hZCB0aGUgcmVxdWlyZWQgbGlicmFyaWVzCgpgYGB7ciwgbWVzc2FnZSA9IEZBTFNFfQpsaWJyYXJ5KHRpZHl2ZXJzZSkKbGlicmFyeShjYXIpCmxpYnJhcnkoY29pbikKYGBgCgojIERhdGEgaW1wb3J0CgpgYGB7ciwgbWVzc2FnZT1GQUxTRX0KbGV0dHVjZSA8LSByZWFkX2NzdigiaHR0cHM6Ly9yYXcuZ2l0aHVidXNlcmNvbnRlbnQuY29tL0dUUEIvUFNMUzIwL21hc3Rlci9kYXRhL2ZyZXNod2VpZ2h0X2xldHR1Y2UudHh0IikKIyMgVGFrZSBhIGdsaW1wc2UgYXQgdGhlIGRhdGEKZ2xpbXBzZShsZXR0dWNlKQpgYGAKCmBgYHtyfQojIyB0cmVhdG1lbnQgdG8gZmFjdG9yCmxldHR1Y2UkdHJlYXRtZW50IDwtIGFzLmZhY3Rvcihhcy5jaGFyYWN0ZXIobGV0dHVjZSR0cmVhdG1lbnQpKQpgYGAKCiMgRGF0YSBleHBsb3JhdGlvbgoKYGBge3J9CiMjIENvdW50IHRoZSBudW1iZXIgb2Ygb2JzZXJ2YXRpb25zIHBlciB0cmVhdG1lbnQKdGFibGUobGV0dHVjZSR0cmVhdG1lbnQpCmBgYAoKTm93IGxldCdzIG1ha2UgYSBib3hwbG90IGRpc3BsYXlpbmcgdGhlIGZyZXNod2VpZ2h0Cm9mIGVhY2ggdHJlYXRtZW50IGNvbmRpdGlvbjoKCmBgYHtyfQpsZXR0dWNlICU+JQogIGdncGxvdChhZXMoeD10cmVhdG1lbnQseT1mcmVzaHdlaWdodCxmaWxsPXRyZWF0bWVudCkpICsgCiAgc2NhbGVfZmlsbF9icmV3ZXIocGFsZXR0ZT0iUmRHeSIpICsKICB0aGVtZV9idygpICsKICBnZW9tX2JveHBsb3Qob3V0bGllci5zaGFwZT1OQSkgKyAKICBnZW9tX2ppdHRlcih3aWR0aCA9IDAuMikgKwogIGdndGl0bGUoIkJveHBsb3Qgb2YgdGhlIGZyZXNod2VpZ3RoIGZvciBlYWNoIHRyZWF0bWVudCBjb25kaXRpb24iKSArCiAgeWxhYigiZnJlc2h3ZWlnaHQgKGdyYW0pIikgKyAKICBzdGF0X3N1bW1hcnkoZnVuLnk9bWVhbiwgZ2VvbT0icG9pbnQiLCBzaGFwZT01LCBzaXplPTMsIGNvbG9yPSJibGFjayIsIGZpbGw9ImJsYWNrIikKYGBgCgpOb3RlIHRoYXQgdGhlcmUgYXJlIG5vIGNsZWFyIG91dGxpZXJzIGluIHRoZSBkYXRhLgpXZSBjYW4gc2VlIHRoYXQgdGhlIG1lYW4gZnJlc3dlaWdodCBpcyB2ZXJ5IGNvbXBhcmFibGUKYmV0d2VlbiB0aGUgY29udHJvbCBhbmQgcmVmb2FrIHRyZWF0bWVudHMgYW5kIGJldHdlZW4gdGhlCmNvbXBvc3QgYW5kIGNvYmMgdHJlYXRtZW50cy4gV2UgY2FuIGFsc28gc2VlIHRoYXQgdGhlIG1lYW4KZnJlc2h3ZWlnaHQgaXMgbXVjaCBoaWdoZXIgaW4gdGhlIGNvYmMgYW5kIGNvbnRyb2wgdHJlYXRtZW50cwp0aGFuIGluIHRoZSBjb250cm9sIGFuZCByZWZvYWsgdHJlYXRtZW50cy4gQnV0IGlzIHRoaXMKb2JzZXJ2ZWQgZGlmZmVyZW5jZSBzaWduaWZpY2FudD8KCiMjIENoZWNraW5nIHRoZSBhc3N1bXB0aW9ucyBvZiBBTk9WQQoKVG8gc3R1ZHkgd2hldGhlciBvciBub3QgdGhlIG9ic2VydmVkIGRpZmZlcmVuY2UgYmV0d2VlbiB0aGUKYXZlcmFnZSBmcmVzaHdlaWdodCB2YWx1ZXMgb2YgdGhlIGRpZmZlcmVudHQgdHJlYXRtZW50IGdyb3VwcwphcmUgc2lnbmlmaWNhbnQsIHdlIG1heSBwZXJmb3JtIGFuIEFOT1ZBLgoKVGhlIG51bGwgaHlwb3RoZXNpcyBvZiBBTk9WQSBzdGF0ZXMgdGhhdDoKVGhlIG1lYW4gZnJlc2h3ZWlndGggaXMgZXF1YWwgYmV0d2VlbiB0aGUgZGlmZmVyZW50IHRyZWF0bWVudCBncm91cHMuCgpUaGUgYWx0ZXJuYXRpdmUgaHlwb3RoZXNpcyBvZiBBTk9WQSBzdGF0ZXMgdGhhdDoKVGhlIG1lYW4gZnJlc2h3ZWlndGggZm9yIGF0IGxlYXN0IG9uZSB0cmVhdG1lbnQgZ3JvdXAgaXMgZGlmZmVyZW50IAp0aGFuIHRoZSBtZWFuIGZyZXNod2VpZ2h0IGluIGF0IGxlYXN0IG9uZSBvdGhlciB0cmVhdG1lbnQgZ3JvdXAuCgpCZWZvcmUgd2UgbWF5IHByb2NlZWQgd2l0aCB0aGUgYW5hbHlzaXMsIHdlIG11c3QgbWFrZSBzdXJlIHRoYXQgYWxsCmFzc3VtcHRpb25zIGZvciBBTk9WQSBhcmUgbWV0LiBBTk9WQSBoYXMgdGhyZWUgYXNzdW1wdGlvbnM6CgoxLiBUaGUgb2JzZXJ2YXRpb25zIGFyZSBpbmRlcGVuZGVudCBvZiBlYWNoIG90aGVyIChpbiBhbGwgZ3JvdXBzKQoyLiBUaGUgZGF0YSAoZnJlc2h3ZWlndGgpIG11c3QgYmUgbm9ybWFsbHkgZGlzdHJpYnV0ZWQgKGluIGFsbCBncm91cHMpCjMuIFRoZSB2YXJpYWJpbGl0eSB3aXRoaW4gYWxsIGdyb3VwcyBpcyBzaW1pbGFyCgojIyMgQXNzdW1wdGlvbiBvZiBpbmRlcGVuZGVuY2UKClRoZSBmaXJzdCBhc3N1bXB0aW9uIGlzIG1ldDsgd2Ugc3RhcnRlZCBvZiB3aXRoIDI4IGxldHR1Y2UgcGxhbnRzIGFuZAp3ZSByYW5kb21seSBzdWJtaXR0ZWQgdGhlbSB0byBvbmUgb2YgZm91ciB0cmVhdG1lbnQgY29uZGl0aW9ucy4gVGhlcmUKaXMgbm8gcmVhc29uIHRvIGJlbGlldmUgdGhhdCB0aGUgcGxhbnRzIGRpc3BsYXkgc3lzdGVtYXRpYyBkaWZmZXJlbmNlcwpiZXR3ZWVuIHR0cmVhdG1lbnQgZ3JvdXBzLCBvdGhlciB0aGFuIHRoZSBhY3R1YWwgdHJlYXRtZW50LgoKIyMjIEFzc3VtcHRpb24gb2Ygbm9ybWFsaXR5CgpGb3IgdGhlIHNlY29uZCBhc3N1bXB0aW9uLCB3ZSBtdXN0IGNoZWNrIG5vcm1hbGl0eSBpbiBlYWNoIGdyb3VwLgoKYGBge3J9CiMjIGdldCBxcXBsb3RzIGZvciBlYWNoIGluZGl2aWR1YWwgdHJlYXRtZW50IGdyb3VwCnBhcihtZnJvdyA9IGMoMiwyKSkKZm9yKGkgaW4gbGV2ZWxzKGxldHR1Y2UkdHJlYXRtZW50KSl7CiAgcXFQbG90KHN1YnNldChsZXR0dWNlLHRyZWF0bWVudCA9PSBpKSRmcmVzaHdlaWdodCwgbWFpbiA9IGksIHlsYWIgPSAiIikKfQpgYGAKCldoaWxlIGluIHRoZSAiQU5PVkFfbGV0dHVjZV9wbGFudHMuUm1kIiBmaWxlIHdlIGFjY2VwdGVkCnRoZSBhc3N1bXB0aW9uIG9mIG5vcm1hbGl0eSwgaXQgbXVzdCBiZSBub3RlZCB0aGF0IGl0IGlzCnRyaWNreSB0byBhc3Nlc3MgdGhlIGFzc3VtcHRpb24gd2l0aCBvbmx5IDcgZGF0YXBvaW50cy4KU2VlICJBTk9WQV9sZXR0dWNlX3BsYW50cy5SbWQiIGZvciBtb3JlIGRldGFpbHMgb24gdGhpcy4KCioqTGV0J3Mgc2F5IHRoYXQgaGVyZSB3ZSBkZWNpZGUgbm90IHRvIGFzc3VtZSBub3JtYWxpdHkuKioKCiMjIyBBc3N1bXB0aW9uIG9mIGVxdWFsIHZhcmlhbmNlcwoKV2UgY2FuIGNoZWNrIHRoZSBhc3N1bXB0aW9uIG9mIGVxdWFsIHZhcmlhbmNlIHdpdGggYSBib3hwbG90OgoKYGBge3J9CmxldHR1Y2UgJT4lCiAgZ2dwbG90KGFlcyh4PXRyZWF0bWVudCx5PWZyZXNod2VpZ2h0LGZpbGw9dHJlYXRtZW50KSkgKyAKICBzY2FsZV9maWxsX2JyZXdlcihwYWxldHRlPSJSZEd5IikgKwogIHRoZW1lX2J3KCkgKwogIGdlb21fYm94cGxvdChvdXRsaWVyLnNoYXBlPU5BKSArIAogIGdlb21faml0dGVyKHdpZHRoID0gMC4yKSArCiAgZ2d0aXRsZSgiQm94cGxvdCBvZiB0aGUgZnJlc2h3ZWlndGggZm9yIGVhY2ggdHJlYXRtZW50IGNvbmRpdGlvbiIpICsKICB5bGFiKCJmcmVzaHdlaWdodCAoZ3JhbSkiKSArIAogIHN0YXRfc3VtbWFyeShmdW4ueT1tZWFuLCBnZW9tPSJwb2ludCIsIHNoYXBlPTUsIHNpemU9MywgY29sb3I9ImJsYWNrIiwgZmlsbD0iYmxhY2siKQpgYGAKCkFzIGEgbWVhc3VyZSBvZiB2YXJpYWJpbGl0eSwgd2UgbWF5IHRha2UgdGhlIGhlaWdodApvZiBlYWNoIGJveHBsb3QncyBib3guIFRoaXMgaXMgdGhlIGludGVydmFsIGJldHdlZW4KdGhlIDI1JSBhbmQgNzUlIHF1YW50aWxlLiBIZXJlIHdlIGNhbiBzZWUgdGhhdCB0aGlzCmludGVydmFsLCBhcyB3ZWxsIGFzIHRoZSBsZW5ndGggb2YgdGhlIHdoaXNrZXJzLCBpcwphcHByb3hpbWF0ZWx5IGVxdWFsIGZvciBtb3N0IGdyb3Vwcy4gSG93ZXZlciwgdGhlCnZhcmlhYmlsaXR5IG9mIGNvYmMgZG9lcyBzZWVtIHRvIGJlIHF1aXRlIGEgYml0IGxhcmdlciAKdGhhbiB0aGUgdmFyaWFiaWxpdHkgaW4gdGhlIHJlZm9hayBncm91cC4gCgoqKldoaWxlIHdlIGFjY2VwdGVkIHRoZSBhc3N1bXB0aW9uIG9mIGVxdWFsIHZhcmlhbmNlcyBpbiB0aGUqKgoqKiJBTk9WQV9sZXR0dWNlX3BsYW50cy5SbWQiIGZpbGUsIHdlIHdpbGwgaGVyZSByZWplY3QgdGhlKioKKiphc3N1bXB0aW9uLioqCgpOb3QgYWxsIGFzc3VtcHRpb25zIGZvciBBTk9WQSBhcmUgbWV0LiBBcyBzdWNoLCB3ZSB3aWxsIHJlbHkKb24gdGhlIG5vbi1wYXJhbWV0dHJpYyBhbHRlcm5hdGl2ZSBvZiBBTk9WQTogdGhlIEtydXNrYWwtV2FsbGlzCnRlc3QuCgojIEFuYWx5c2lzCgojIyBLcnVza2FsLVdhbGxpcyByYW5rIHRlc3QKCklmIHdlIHdhbnQgdG8gdGVzdCBmb3IgYSBkaWZmZXJlbmNlIGluIHRoZSBtZWRpYW4gb2YgdGhlCmRpZmZlcmVudCB0cmVhdG1lbnQgZ3JvdXBzLCB3ZSBoYXZlIHRvICoqIGFzc3VtZSBhIGxvY2F0aW9uIHNoaWZ0ICoqLApzYXlpbmcgdGhhdCBhbGwgdHJlYXRtZW50IGdyb3VwcyBmb2xsb3cgdGhlIHNhbWUgZGlzdHJpYnV0aW9uLApidXQgd2l0aCBhIGRpZmZlcmVudCBtZWRpYW4uCgpIb3dldmVyLCBoZXJlLCB3ZSBtaWdodCBiZSAqKiBub3QgcHJlcGFyZWQgZm9yIHRha2luZyB0aGlzIGFzc3VtcHRpb24gKiouCldoaWxlIHRoZSByYW5nZSBhbmQgc3ByZWFkIG9mIHRoZSBkYXRhIGlzIHNpbWlsYXIgZm9yIG1vc3QgZ3JvdXBzCihzZWUgYm94cGxvdCksIHRoZXJlIGlzIGEgcXVpdGUgYSBiaWcgZGlmZmVyZW5jZSBiZXR3ZWVuIHRoZSBJUVIgb2YKdGhlIHJlZm9hayBhbmQgY29iYyBjb25kaXRpb25zLgoKV2hlbiB3ZSByZWplY3QgdGhlIGFzc3VtaW5nIHR0aGUgbG9jYXRpb24gc2hpZnQsIHdlIGNhbiByZWxheCB0aGUKZGlzdHJpYnV0aW9uYWwgYXNzdW1wdGlvbnMgZXZlbiBmdXJ0aGVyIGFuZCBwZXJmb3JtIGEgdGVzdCBpbiB0ZXJtcwpvZiBwcm9iYWJpbGlzdGljIGluZGljZXMgKHNlZSB0aGUgIk5vbl9wYXJhbWV0cmljX3NocmltcHMuUm1kIiBmaWxlKS4KCldpdGggdGhpcyBLcnVza2FsLVdhbGxpcyB0ZXN0LCB3ZSB3aWxsIHRlc3Qgd2hldGhlciBvciBub3QgdGhlIGNoYW5jZQp0aGF0IGEgcmFuZG9tIHZhbHVlIG9mIG9uZSB0cmVhdG1lbnQgZ3JvdXAgaXMgbGFyZ2VyIHRoYW4gb3IgZXF1YWwgdG8KKCIkXGdlcSQiKSBhIHJhbmRvbSB2YWx1ZSBvZiBhbm90aGVyIHRyZWF0bWVudCBncm91cCBpcyBzaWduaWZpY2FudGx5CmRpZmZlcmVudCBmcm9tIDUwJS4KCiMjIyBIeXBvdGhlc2VzCgotIE51bGwgaHlwb3RoZXNpczoKJEgwJDogVGhlIGRpc3RyaWJ1dGlvbiBvZiBmcmVzaHdlaWdodHMgb2YgbGV0dHVjZSBwbGFudHMgYXJlIGVxdWFsCmZvciBhbGwgdHJlYXRtZW50IGNvbmRpdGlvbnMuCgotIEFsdGVybmF0aXZlIGh5cG90aGVzaXM6CiRIQSQ6IFRoZSBjaGFuY2UgdGhhdCBhIHJhbmRvbSB2YWx1ZSBvZiBhdCBsZWFzdCBvbmUgdHJlYXRtZW50IGdyb3VwIAppcyBsYXJnZXIgdGhhbiBvciBlcXVhbCB0byAoIiRcZ2VxJCIpIGEgcmFuZG9tIHZhbHVlIG9mIGF0IGxlYXN0Cm9uZSBvdGhlciB0cmVhdG1lbnQgZ3JvdXAgaXMgc2lnbmlmaWNhbnRseSBkaWZmZXJlbnQgZnJvbSA1MCUuCgojIyMgdGVzdAoKYGBge3J9CnNldC5zZWVkKDEpCmt3UGVybSA8LSBrcnVza2FsX3Rlc3QoZnJlc2h3ZWlnaHR+dHJlYXRtZW50LGxldHR1Y2UsCiAgICAgICAgICAgICAgICAgICAgICAgZGlzdHJpYnV0aW9uPWFwcHJveGltYXRlKG5yZXNhbXBsZT0xMDAwMDApKQprd1Blcm0KYGBgCgpOb3RlIHRoYXQgaGVyZSB3ZSBhcmUgY29tcGFyaW5nIHRoZSBvYnNlcnZlZCB0ZXN0IHN0YXRpc3RpYwooY2hpLXNxdWFyZWQgPSBgciBmb3JtYXQoa3dQZXJtQHN0YXRpc3RpY0B0ZXN0c3RhdGlzdGljLCBkaWdpdHM9NSlgKSB3aXRoIHRoZSB0ZXN0IHN0YXRpc3RpY3MgZGVyaXZlZCBmcm9tCmFuIGVtcGlyaWNhbCBkaXN0cmlidXRpb24gdGhhdCB3YXMgZ2VuZXJhdGVkIGJ5IHRha2luZyAxMC4wMDAKcGVybXV0YXRpb25zIG9mIHRoZSBvcmlnaW5hbCBsZXR0dWNlIGRhdGFzZXQuCgpXZSBmaW5kIGFuIGV4dHJlbWx5IHNpZ25pZmljYW50IChwIDwgMWUtMDUpIG9mIHRoZSB0cmVhdG1lbnQKb24gdGhlIGZyZXNod2VpZ2h0LiBPbiB0aGUgNSUgZ2xvYmFsIHNpZ25pZmljYW5jZSBsZXZlbCwgd2UgbWF5CnN0YXRlIHRoYXQgdGhlIGNoYW5jZSB0aGF0IGEgcmFuZG9tIHZhbHVlIG9mIGF0IGxlYXN0IG9uZSB0cmVhdG1lbnQgCmdyb3VwIGlzIGxhcmdlciB0aGFuIG9yIGVxdWFsIHRvICgiJFxnZXEkIikgYSByYW5kb20gdmFsdWUgb2YgYXQgCmxlYXN0IG9uZSBvdGhlciB0cmVhdG1lbnQgZ3JvdXAgaXMgc2lnbmlmaWNhbnRseSBkaWZmZXJlbnQgZnJvbSA1MCUuCgpOb3csIHdlIHdpbGwgcGVyZm9ybSBhIHBvc3QtaG9jIGFuYWx5c2lzIHRvIGZpbmQgb3V0IHdoaWNoIHNwZWNpZmljIApncm91cHMgYXJlIGRpZmZlcmVudCBmcm9tIGVhY2ggb3RoZXIuCgojIyBQb3N0LWhvYyBhbmFseXNpcwoKV2Ugd2lsbCBwZXJmb3JtIGEgcG9zdC1ob2MgYW5hbHlzaXMgd2l0aCBwYWlyd2lzZSBXaWxjb3hvbiByYW5rCnN1bSB0ZXN0LiBBcyB3ZSBkaWQgbm90IHdhbnQgdG8gYXNzdW1lIHRoZSBsb2NhdGlvbiBzaGlmdCwgd2UgCndpbGwgaW50ZXJwcmV0IHRoZSBvdXRjb21lIGluIHRlcm1zIG9mIHByb2JhYmlsaXN0aWMgaW5kaWNlcy4KTm90ZSB0aGF0IGFmdGVyIHRoZSBhbmFseXNpcywgd2Ugd2lsbCBuZWVkIHRvIGNvcnJlY3QgdGhlIGFjcXVpcmVkCnAtdmFsdWVzIGZvciBtdWx0aXBsZSB0ZXN0aW5nLgoKRm9yIGVhY2ggcGFpcndpc2UgdGVzdCwgd2UgaGF2ZSB0aGUgZm9sbG93aW5nIGh5cG90aGVzZXM6CgotIE51bGwgaG9wb3RoZXNpczoKJEgwJDogVGhlIGRpc3RyaWJ1dGlvbiBvZiBmcmVzaHdlaWdodHMgb2YgbGV0dHVjZSBwbGFudHMgYXJlIGVxdWFsCmZvciBib3RoIHRyZWF0bWVudCBjb25kaXRpb25zLgoKLSBBbHRlcm5hdGl2ZSBoeXBvdGhlc2lzOgokSEEkOiBUaGUgY2hhbmNlIHRoYXQgYSByYW5kb20gdmFsdWUgb2YgdHJlYXRtZW50IGdyb3VwIDEgaXMgbGFyZ2VyIAp0aGFuIG9yIGVxdWFsIHRvICgiJFxnZXEkIikgYSByYW5kb20gdmFsdWUgb2YgdHJlYXRtZW50IGdyb3VwIDIgCmlzIHNpZ25pZmljYW50bHkgZGlmZmVyZW50IGZyb20gNTAlLgoKYGBge3J9CiMjIGluaXRpYWwgYXR0ZW1wdCB0byBwZXJmb3JtIHRoZSBhbmFseXNpcwpwYWlyd2lzZS53aWxjb3gudGVzdChsZXR0dWNlJGZyZXNod2VpZ2h0LGxldHR1Y2UkdHJlYXRtZW50KQpgYGAKCldlIGdldCB0aGUgZm9sbG93aW5nIHdhcm5pbmcgbWVzc2FnZToKYGNhbm5vdCBjb21wdXRlIGV4YWN0IHAtdmFsdWUgd2l0aCB0aWVzYC4KClRoaXMgaXMgYmVjYXVzZSB0aGUgYHBhaXJ3aXNlLndpbGNveC50ZXN0KClgIHVzZSB0aGUKc3RhbmRhcmQgYHdpbGNveC50ZXN0KClgIGZ1bmN0aW9uLiBJbiB0aGUgaGVscCBmaWxlCm9mIHRoaXMgZnVuY3Rpb24gKD93aWxjb3gudGVzdCksIHdlIGNhbiByZWFkIHRoYXQgaW4gdGhlCnByZXNlbmNlIG9mIHRpZXMgaW4gdGhlIGRhdGEsIHRoZSBmdW5jdGlvbiB3aWxsIHBlcmZvcm0KYSBhc3ltcHRvdGljIHRlc3QgcmF0aGVyIHRoYW4gYW4gZXhhY3QgdGVzdC4KCklmIHdlIGRvIHdhbnQgdG8gb2J0YWluIGV4YWN0IHAtdmFsdWVzLCB3ZSBtYXkgdXNlIHRoZQpgd2lsY294X3Rlc3QoKWAgZnVuY3Rpb24gZnJvbSB0aGUgYGNvaW5gIHBhY2thZ2UgZm9yCmVhY2ggcGFpcndpc2UgY29tYmluYXRpb24gb2YgdHJlYXRtZW50cy4gVGhlIG9idGFpbmVkCnAtdmFsdWVzIG11c3QgYmUgY29ycmVjdGVkIGZvciBtdWx0aXBsZSB0ZXN0aW5nLCBlLmcuCndpdGggdGhlIGBwLmFkanVzdCgpYCBmdW5jdGlvbi4KCmBgYHtyfQojIyBjYWx1Y2xhdGUgdGhlIHAtdmFsdWUgZm9yIGVhY2ggdHJlYXRtZW50IGNvbWJpbmF0aW9uIHdpdGggd2lsY294b25fdGVzdAp0cmVhdG1lbnRzIDwtIGxldmVscyhsZXR0dWNlJHRyZWF0bWVudCkKZnJlc2h3ZWlnaHQgPC0gbGV0dHVjZSRmcmVzaHdlaWdodAoKcHZhbHVlcyA8LSBjb21ibih0cmVhdG1lbnRzLDIsZnVuY3Rpb24oeCl7CiAgCiAgIyMgUGFpcndpc2UgV2lsY29uIHRlc3QKICB0ZXN0ID0gd2lsY294X3Rlc3QoZnJlc2h3ZWlnaHR+dHJlYXRtZW50LHN1YnNldChsZXR0dWNlLHRyZWF0bWVudCVpbiV4KSwgZGlzdHJpYnV0aW9uID0gJ2V4YWN0JykKICAKICAjIyBHZXQgYW5kIHN0b3JlIHAtdmFsdWUgb2YgdGVzdAogIHB2YWx1ZSh0ZXN0KQp9KQoKIyMgQWRqdXN0IGZvciBtdWx0aXBsZSB0ZXN0aW5nCnB2YWx1ZXNfaG9sbSA9IHAuYWRqdXN0KHB2YWx1ZXMsbWV0aG9kID0gJ2hvbG0nKSAKCiMjIGxpbmsgdGhlIHAtdmFsdWUgd2l0aCB0aGUgY29ycmVjdCBwYWlyd2lzZSB0ZXN0Cm5hbWVzKHB2YWx1ZXNfaG9sbSkgPC0gY29tYm4obGV2ZWxzKGxldHR1Y2UkdHJlYXRtZW50KSwyLHBhc3RlLGNvbGxhcHNlPSJfVlNfIikKcHZhbHVlc19ob2xtCmBgYAoKVGhlIGV4YWN0IHAtdmFsdWVzIGRvIGluZGVlZCBkZXZpYXRlIGZyb20gdGhvc2UgY2FsY3VsYXRlZAp3aXRoIHRoZSBgcGFpcndpc2Uud2lsY294LnRlc3QoKWAgZnVuY3Rpb24uIFdlIHdpbGwgcHJvY2VlZAp3aXRoIHRoZSBleGFjdCBwLXZhbHVlcy4KCk5vdyB3ZSB3aWxsIGNvbXB1dGUgdGhlIHBvaW50IGVzdGltYXRpb24gZm9yIHRoZSBwcm9iYWJpbGlzdGljCmluZGV4IChmb3IgZWFjaCBwYWlyd2lzZSBjb21wYXJpc29uKS4gTm90ZSB0aGF0IHdlIGFscmVhZHkKZGlkIHRoaXMgaW4gdGhlICJOb25fcGFyYW1ldHJpY19zaHJpbXBzLlJtZCIgYW5kCiJOb25fcGFyYW1ldHJpY19OSEFORVMuUm1kIiBmaWxlIGZvciBhIHNpbmdsZSBjb21wYXJpc29uLgoKYGBge3J9CiMjIENvdW50IHRoZSBudW1iZXIgb2Ygb2JzZXJ2YXRpb25zIHBlciBncm91cApuR3JvdXAgPC0gdGFibGUobGV0dHVjZSR0cmVhdG1lbnQpCgojIyBDb21wdXRlIHRoZSBwcm9iYWJpbGlzdGljIGluZGV4IGZvciBlYWNoIHBhaXJ3aXNlIGNvbWJpbmF0aW9uCnRyZWF0bWVudHMgPC0gbGV2ZWxzKGxldHR1Y2UkdHJlYXRtZW50KQoKcHJvYkluZCA8LSBjb21ibih0cmVhdG1lbnRzLDIsZnVuY3Rpb24oeCl7CiAgIyMgQ29tcHV0ZSB0aGUgVTEgc3RhdGlzdGljCiAgVTEgPC0gd2lsY294LnRlc3QoZnJlc2h3ZWlnaHR+dHJlYXRtZW50LHN1YnNldChsZXR0dWNlLHRyZWF0bWVudCVpbiV4KSkkc3RhdGlzdGljCiAgCiAgIyMgQ29tcHV0ZSB0aGUgcHJvYmFiaWxpc3RpYyBpbmRleAogIFUxL3Byb2Qobkdyb3VwW3hdKQp9KQoKIyMgbGluayB0aGUgcHJvYmFiaWxpc3RpYyBpbmRleCB3aXRoIHRoZSBjb3JyZWN0IHBhaXJ3aXNlIHRlc3QKbmFtZXMocHJvYkluZCkgPC0gY29tYm4obGV2ZWxzKGxldHR1Y2UkdHJlYXRtZW50KSwyLHBhc3RlLGNvbGxhcHNlPSJfVlNfIikKcHJvYkluZApgYGAKCldlIGFnYWluIHNlZSB0aGUgc2FtZSB3YXJuaW5nIG1lc3NhZ2UuIEhlcmUsIHRoaXMgaXMgbm90IGEKcHJibGVtLCB3ZSBhcmUgbm90IGludGVyZXN0ZWQgaW4gdGhlIHAtdmFsdWVzICh3aGljaCB3ZSAKYWxyZWFkeSBjb21wdXRlZCksIHdlIG9ubHkgY2FyZSBhYm91dCB0aGUgcHJvYmFiaWxpc3RpYyBpbmRpY2VzLAp0aGF0IGFyZSBjYWxjdWxhdGVkIGZyb20gdGhlIFUxIHN0YXRpc3RpYy4gVTEgaXMgY29tcHV0ZWQgYXMKdGhlIG51bWJlciBvZiB0aW1lcyBhbiBvYnNlcnZhdGlvbiBvZiBncm91cCAxIGlzIGxhcmdlciB0aGFuIG9yCmVxdWFsIHRvIGFuIG9ic2VydmF0aW9uIG9mIGdyb3VwIDIuIFRoaXMgc3RhdGlzdGljIGlzIHRodXMKZGVmaW5lZCBldmVuIGluIHRoZSBjYXNlIG9mIHRpZXMuCgojIENvbmNsdXNpb24KCldlIGZpbmQgYW4gZXh0cmVtbHkgc2lnbmlmaWNhbnQgKHAgPCAxZS0wNSkgb2YgdGhlIHRyZWF0bWVudApvbiB0aGUgZnJlc2h3ZWlnaHQuIE9uIHRoZSA1JSBnbG9iYWwgc2lnbmlmaWNhbmNlIGxldmVsLCB3ZSBtYXkKc3RhdGUgdGhhdCB0aGUgY2hhbmNlIHRoYXQgYSByYW5kb20gdmFsdWUgb2YgYXQgbGVhc3Qgb25lIHRyZWF0bWVudCAKZ3JvdXAgIGlzIGxhcmdlciB0aGFuIG9yIGVxdWFsIHRvICgiJFxnZXEkIikgYSByYW5kb20gdmFsdWUgb2YgYXQgCmxlYXN0IG9uZSBvdGhlciB0cmVhdG1lbnQgZ3JvdXAgaXMgc2lnbmlmaWNhbnRseSBkaWZmZXJlbnQgZnJvbSA1MCUuCgpGb3IgdGhlIHBvc3QtaG9jIGFuYWx5c2lzOgoKLSBXZSBmaW5kIGEgaGlnaGx5IHNpZ25pZmljYW50IGRpZmZlcmVuY2UgaW4gdGhlIGRpc3RyaWJ1dGlvbnMgYmV0d2Vlbgp0aGUgY29tcG9zdCB0cmVhdG1lbnQgYW5kIHRoZSBjb250cm9sIHRyZWF0bWVudC4gVGhlIHByb2JhYmlsaXR5IAp0aGF0IHRoZSBmcmVzaHdlaWd0aCBvZiBwbGFudHMgZ3Jvd24gaW4gY29tcG9zdCBzb2lsIGlzIGhpZ2hlciB0aGFuCm9yIGVxdWFsIHRvICgiJFxnZXEkIikgdGhlIGZyZXNod2VpZ3RoIG9mIHBsYW50cyBncm93biBpbiBjb250cm9sIApzb2lsIGlzIDEwMCUuIFRoaXMgaXMgaGlnaGx5IHNpZ25pZmljYW50bHkgZGlmZmVyZW50IGZyb20gNTAlCihhZGp1c3RlZCBwLXZhbHVlPTAuMDAzKS4gCgotIFdlIGZpbmQgYSBoaWdobHkgc2lnbmlmaWNhbnQgZGlmZmVyZW5jZSBpbiB0aGUgZGlzdHJpYnV0aW9ucyBiZXR3ZWVuCnRoZSBjb2JjIHRyZWF0bWVudCBhbmQgdGhlIGNvbnRyb2wgdHJlYXRtZW50LiBUaGUgcHJvYmFiaWxpdHkgCnRoYXQgdGhlIGZyZXNod2VpZ3RoIG9mIHBsYW50cyBncm93biBpbiBjb21wb3N0IHNvaWwgaXMgaGlnaGVyIHRoYW4Kb3IgZXF1YWwgdG8gKCIkXGdlcSQiKSB0aGUgZnJlc2h3ZWlndGggb2YgcGxhbnRzIGdyb3duIGluIGNvbnRyb2wgCnNvaWwgaXMgOTglLiBUaGlzIGlzIGhpZ2hseSBzaWduaWZpY2FudGx5IGRpZmZlcmVudCBmcm9tIDUwJQooYWRqdXN0ZWQgcC12YWx1ZT0wLjAwNSkuIAoKLSBXZSBmaW5kIGEgaGlnaGx5IHNpZ25pZmljYW50IGRpZmZlcmVuY2UgaW4gdGhlIGRpc3RyaWJ1dGlvbnMgYmV0d2Vlbgp0aGUgY29tcG9zdCB0cmVhdG1lbnQgYW5kIHRoZSByZWZvYWsgdHJlYXRtZW50LiBUaGUgcHJvYmFiaWxpdHkgCnRoYXQgdGhlIGZyZXNod2VpZ3RoIG9mIHBsYW50cyBncm93biBpbiBjb21wb3N0IHNvaWwgaXMgaGlnaGVyIHRoYW4Kb3IgZXF1YWwgdG8gKCIkXGdlcSQiKSB0aGUgZnJlc2h3ZWlndGggb2YgcGxhbnRzIGdyb3duIGluIGNvbnRyb2wgCnNvaWwgaXMgMTAwJS4gVGhpcyBpcyBoaWdobHkgc2lnbmlmaWNhbnRseSBkaWZmZXJlbnQgZnJvbSA1MCUKKGFkanVzdGVkIHAtdmFsdWU9MC4wMDMpLiAKCi0gV2UgZmluZCBhIGhpZ2hseSBzaWduaWZpY2FudCBkaWZmZXJlbmNlIGluIHRoZSBkaXN0cmlidXRpb25zIGJldHdlZW4KdGhlIGNvYmMgdHJlYXRtZW50IGFuZCB0aGUgcmVmb2FrIHRyZWF0bWVudC4gVGhlIHByb2JhYmlsaXR5IAp0aGF0IHRoZSBmcmVzaHdlaWd0aCBvZiBwbGFudHMgZ3Jvd24gaW4gY29tcG9zdCBzb2lsIGlzIGhpZ2hlciB0aGFuCm9yIGVxdWFsIHRvICgiJFxnZXEkIikgdGhlIGZyZXNod2VpZ3RoIG9mIHBsYW50cyBncm93biBpbiBjb250cm9sIApzb2lsIGlzIDEwMCUuIFRoaXMgaXMgaGlnaGx5IHNpZ25pZmljYW50bHkgZGlmZmVyZW50IGZyb20gNTAlCihhZGp1c3RlZCBwLXZhbHVlPTAuMDAzKS4gCgpGb3IgdGhlIG90aGVyIGNvbnRyYXN0LCB3ZSBkbyBub3QgZW5vdWdoIGZpbmQgZXZpZGVuY2UgdG8gc3VnZ2VzdApzaWduaWZpY2FudCBkaWZmZXJlbmNlcyBiZXR3ZWVuIHRoZSB0cmVhdG1lbnQgZ3JvdXBzLgoKV2UgbWF5IGNvbmNsdWRlIHRoYXQgc3VwcGxlbWVudGluZyBzb2lsIHdpdGggY29tcG9zdCBvciB3aXRoCmJvdGggY29tcG9zdCBhbmQgYmlvY2hhciBoYXMgYSBwb3NpdGl2ZSBlZmZlY3Qgb24gdGhlIGZyZXNod2VpZ3RoCm9mIGxldHR1Y2UgcGxhbnRzLiBOb3RlIHRoYXQsIHF1YWxpdGF0aXZlbHksIHRoZXNlIGNvbmNsdXNpb24gYXJlCmV4YWN0bHkgdGhlIHNhbWUgYXMgd2l0aCB0aGUgQU5PVkEgYW5hbHlzaXMgb2YgdGhlIGRhdGFzZXQgaW4gdGhlIAoiQU5PVkFfbGV0dHVjZV9wbGFudHMuUm1kIiBmaWxlLgoKLS0tCgojIFtIb21lXShodHRwczovL2d0cGIuZ2l0aHViLmlvL1BTTFMyMC8pIHstfQoKCgoKCgoKCgoKCgoKCgo=