Setting up

Call Data

Demographics

## Age & Food Neophobia
Demo %>%
  ggplot(aes(x = Age, y = FNSscore)) +
  geom_point() +
  geom_smooth(method = "lm") +
  theme_bw() +
  stat_cor()
## `geom_smooth()` using formula 'y ~ x'

## Age & WW Score
Demo %>%
  ggplot(aes(x = Age, y = WWscore)) +
  geom_point() +
  geom_smooth(method = "lm") +
  theme_bw() +
  stat_cor()
## `geom_smooth()` using formula 'y ~ x'

## BMI & Food Neophobia
Demo %>%
  ggplot(aes(x = BMI, y = FNSscore)) +
  geom_point() +
  geom_smooth(method = "lm") +
  theme_bw() +
  stat_cor()
## `geom_smooth()` using formula 'y ~ x'

## BMI & WW Score
Demo %>%
  ggplot(aes(x = BMI, y = WWscore)) +
  geom_point() +
  geom_smooth(method = "lm") +
  theme_bw() +
  stat_cor()
## `geom_smooth()` using formula 'y ~ x'

## FNS & WW Score
Demo %>%
  ggplot(aes(x = FNSscore, y = WWscore)) +
  geom_point() +
  geom_smooth(method = "lm") +
  theme_bw() +
  stat_cor()
## `geom_smooth()` using formula 'y ~ x'

## FNS & WW Intake
Demo %>%
  ggplot(aes(x = FNSscore, y = WWoz)) +
  geom_point() +
  geom_smooth(method = "lm") +
  theme_bw() +
  stat_cor()
## `geom_smooth()` using formula 'y ~ x'

## WW Score & WW Intake
Demo %>%
  ggplot(aes(x = WWscore, y = WWoz)) +
  geom_point() +
  geom_smooth(method = "lm") +
  theme_bw() +
  stat_cor()
## `geom_smooth()` using formula 'y ~ x'

Phytic acid

Reliability

## Overall 
MB.Wide %>%
  ggplot(aes(x = Overall_1, y = Overall_2)) +
  geom_point() +
  geom_smooth(method = "lm") +
  theme_bw() +
  stat_cor()
## `geom_smooth()` using formula 'y ~ x'

## Appearance
MB.Wide %>%
  ggplot(aes(x = Appearance_1, y = Appearance_2)) +
  geom_point() +
  geom_smooth(method = "lm") +
  theme_bw() +
  stat_cor()
## `geom_smooth()` using formula 'y ~ x'

## Color
MB.Wide %>%
  ggplot(aes(x = Color_1, y = Color_2)) +
  geom_point() +
  geom_smooth(method = "lm") +
  theme_bw() +
  stat_cor()
## `geom_smooth()` using formula 'y ~ x'

## Aroma
MB.Wide %>%
  ggplot(aes(x = Aroma_1, y = Aroma_2)) +
  geom_point() +
  geom_smooth(method = "lm") +
  theme_bw() +
  stat_cor()
## `geom_smooth()` using formula 'y ~ x'

## Texture
MB.Wide %>%
  ggplot(aes(x = Texture_1, y = Texture_2)) +
  geom_point() +
  geom_smooth(method = "lm") +
  theme_bw() +
  stat_cor()
## `geom_smooth()` using formula 'y ~ x'

## Flavor
MB.Wide %>%
  ggplot(aes(x = Flavor_1, y = Flavor_2)) +
  geom_point() +
  geom_smooth(method = "lm") +
  theme_bw() +
  stat_cor()
## `geom_smooth()` using formula 'y ~ x'

Drivers of liking

Please note that for the purchase intent question, 1 is coded as “Buy”, 2 is coded as “Maybe”, 3 is coded as “Not Buy”. That is why the relationship between liking and purchase intent is negative.

## Appearance 
Decision %>%
  ggplot(aes(x = Appearance, y = Overall)) +
  geom_jitter() +
  geom_smooth(method = "lm") +
  theme_bw() +
  stat_cor()
## `geom_smooth()` using formula 'y ~ x'

## Aroma
Decision %>%
  ggplot(aes(x = Aroma, y = Overall)) +
  geom_jitter() +
  geom_smooth(method = "lm") +
  theme_bw() +
  stat_cor()
## `geom_smooth()` using formula 'y ~ x'

## Color
Decision %>%
  ggplot(aes(x = Color, y = Overall)) +
  geom_jitter() +
  geom_smooth(method = "lm") +
  theme_bw() +
  stat_cor()
## `geom_smooth()` using formula 'y ~ x'

## Texture
Decision %>%
  ggplot(aes(x = Texture, y = Overall)) +
  geom_jitter() +
  geom_smooth(method = "lm") +
  theme_bw() +
  stat_cor()
## `geom_smooth()` using formula 'y ~ x'

## Flavor
Decision %>%
  ggplot(aes(x = Flavor, y = Overall)) +
  geom_jitter() +
  geom_smooth(method = "lm") +
  theme_bw() +
  stat_cor()
## `geom_smooth()` using formula 'y ~ x'

## Buy
Decision %>%
  ggplot(aes(x = as.numeric(Buy), y = Overall, fill = as.numeric(Buy))) +
  geom_jitter() +
  geom_smooth(method = "lm") +
  theme_bw() +
  stat_cor()
## `geom_smooth()` using formula 'y ~ x'

## CorrPlot 
AttCorr.df <- Decision %>%
  dplyr::select("Buy", "Appearance", "Color", "Aroma", "Flavor", "Texture", "Flavor", "Overall")

AttCorr.df$Buy <- as.numeric(AttCorr.df$Buy)

AttCorr <- AttCorr.df %>%
  cor(method = "pearson")

corrplot(AttCorr, method = "color", order = "original", tl.col="black") 

Interactions between conditions

## Summary stats
SummStats <- MB.Long %>%
  group_by(Ferm.Type, Millet.Ratio, Attribute) %>%
  get_summary_stats(Rating, type = "mean_sd")

## Fermentation*Ratio*Attribute interaction
FermRatioAtt.aov <- aov(Rating ~ Ferm.Type*as.factor(Millet.Ratio)*Attribute, MB.Long) 
summary(FermRatioAtt.aov)
##                                               Df Sum Sq Mean Sq F value
## Ferm.Type                                      1    257   257.0 138.427
## as.factor(Millet.Ratio)                        5   3951   790.3 425.747
## Attribute                                      5    428    85.5  46.084
## Ferm.Type:as.factor(Millet.Ratio)              5    387    77.4  41.720
## Ferm.Type:Attribute                            5     75    15.1   8.118
## as.factor(Millet.Ratio):Attribute             25    947    37.9  20.417
## Ferm.Type:as.factor(Millet.Ratio):Attribute   25     90     3.6   1.931
## Residuals                                   8568  15904     1.9        
##                                               Pr(>F)    
## Ferm.Type                                    < 2e-16 ***
## as.factor(Millet.Ratio)                      < 2e-16 ***
## Attribute                                    < 2e-16 ***
## Ferm.Type:as.factor(Millet.Ratio)            < 2e-16 ***
## Ferm.Type:Attribute                         1.18e-07 ***
## as.factor(Millet.Ratio):Attribute            < 2e-16 ***
## Ferm.Type:as.factor(Millet.Ratio):Attribute  0.00353 ** 
## Residuals                                               
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1

Difference - Overall

## Overall 
Overall <- MB.Long %>%
  filter(Attribute == "Overall") 
Overall.aov <- aov(Rating ~ Ferm.Type*as.factor(Millet.Ratio), Overall) 
summary(Overall.aov)
##                                     Df Sum Sq Mean Sq F value   Pr(>F)    
## Ferm.Type                            1   98.7   98.70   54.57 2.54e-13 ***
## as.factor(Millet.Ratio)              5 1254.7  250.93  138.73  < 2e-16 ***
## Ferm.Type:as.factor(Millet.Ratio)    5  111.4   22.27   12.31 1.03e-11 ***
## Residuals                         1428 2582.9    1.81                     
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
  ## Scatter plot
  Overall %>%
    ggplot(aes(x = Millet.Ratio, y = Rating, color = Ferm.Type, group = Ferm.Type)) +
    geom_jitter() +
    geom_smooth(method = "lm")+
    scale_color_manual(values = c("#AFB42B", "#2E7D32"))+
    stat_cor()+
    theme_bw()
## `geom_smooth()` using formula 'y ~ x'

  ## Boxplot
       ## Overall
      Overall %>%
        ggplot(aes(x = Ferm.Type, y = Rating, color = Ferm.Type)) +
        geom_boxplot() +
        geom_jitter()+
        stat_compare_means(paired = TRUE) +
        scale_color_manual(values = c("#AFB42B", "#2E7D32"))+
        theme_bw()

      ## Faceted by millet ratio
      Overall %>%
        ggplot(aes(x = Ferm.Type, y = Rating, color = Ferm.Type)) +
        geom_boxplot() +
        geom_jitter()+
        facet_wrap(~as.factor(Millet.Ratio)) +
        stat_compare_means(paired = TRUE) +
        scale_color_manual(values = c("#AFB42B", "#2E7D32"))+
        theme_bw()

Difference - Overall, unfermented, compared to 0%

Overall.Unferm <- MB.Long %>%
  filter(Attribute == "Overall") %>%
  filter(Ferm.Type == "Unfermented") %>%
  group_by(Millet.Ratio, Participant) %>%
  summarize(Rating = mean(Rating))
## `summarise()` has grouped output by 'Millet.Ratio'. You can override using the `.groups` argument.
Overall.unferm.aov <- aov(Rating ~ as.factor(Millet.Ratio), Overall.Unferm) 
summary(Overall.unferm.aov)
##                          Df Sum Sq Mean Sq F value   Pr(>F)    
## as.factor(Millet.Ratio)   5   80.5  16.099   14.54 6.68e-12 ***
## Residuals               174  192.6   1.107                     
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
  ## Boxplot
      Overall.Unferm %>%
        ggplot(aes(x = as.factor(Millet.Ratio), y = Rating, color = as.factor(Millet.Ratio))) +
        geom_boxplot() +
        geom_jitter()+
        scale_color_manual(values = c("#2E7D32", "#2E7D32", "#2E7D32", "#2E7D32", "#2E7D32", "#2E7D32"))+
        theme_bw() +
        scale_y_continuous(breaks = seq(0, 9), limits = c(0, 9))+ 
        ggtitle("Unfermented Millet Subsitution Ratio vs Liking")

  ## 0 vs 10
  Overall.Unferm %>% 
    filter(Millet.Ratio%in%c("0", "10")) %>%
    ggplot(aes(x = as.factor(Millet.Ratio), y = Rating, color = as.factor(Millet.Ratio))) +
    geom_boxplot() +    
    geom_jitter()+
    stat_compare_means(paired = TRUE) +
    scale_color_manual(values = c("#2E7D32", "#2E7D32"))+
    theme_bw()

  ## 0 vs 20
    Overall.Unferm %>% 
    filter(Millet.Ratio%in%c("0", "20")) %>%
    ggplot(aes(x = as.factor(Millet.Ratio), y = Rating, color = as.factor(Millet.Ratio))) +
    geom_boxplot() +    
    geom_jitter()+
    stat_compare_means(paired = TRUE) +
    scale_color_manual(values = c("#2E7D32", "#2E7D32"))+
    theme_bw()

  ## 0 vs 30
    Overall.Unferm %>% 
    filter(Millet.Ratio%in%c("0", "30")) %>%
    ggplot(aes(x = as.factor(Millet.Ratio), y = Rating, color = as.factor(Millet.Ratio))) +
    geom_boxplot() +    
    geom_jitter()+
    stat_compare_means(paired = TRUE) +
    scale_color_manual(values = c("#2E7D32", "#2E7D32"))+
    theme_bw()

  ## 0 vs 40
    Overall.Unferm %>% 
    filter(Millet.Ratio%in%c("0", "40")) %>%
    ggplot(aes(x = as.factor(Millet.Ratio), y = Rating, color = as.factor(Millet.Ratio))) +
    geom_boxplot() +    
    geom_jitter()+
    stat_compare_means(paired = TRUE) +
    scale_color_manual(values = c("#2E7D32", "#2E7D32"))+
    theme_bw()  

  ## 0 vs 50
    Overall.Unferm %>% 
    filter(Millet.Ratio%in%c("0", "50")) %>%
    ggplot(aes(x = as.factor(Millet.Ratio), y = Rating, color = as.factor(Millet.Ratio))) +
    geom_boxplot() +    
    geom_jitter()+
    stat_compare_means(paired = TRUE) +
    scale_color_manual(values = c("#2E7D32", "#2E7D32"))+
    theme_bw()

Difference - Overall, fermented, compared to 0%

Overall.Ferm <- MB.Long %>%
  filter(Attribute == "Overall") %>%
  filter(Ferm.Type == "Fermented") %>%
  group_by(Millet.Ratio, Participant) %>%
  summarize(Rating = mean(Rating))
## `summarise()` has grouped output by 'Millet.Ratio'. You can override using the `.groups` argument.
Overall.ferm.aov <- aov(Rating ~ as.factor(Millet.Ratio), Overall.Ferm) 
summary(Overall.ferm.aov)
##                          Df Sum Sq Mean Sq F value Pr(>F)    
## as.factor(Millet.Ratio)   5  261.0    52.2    47.4 <2e-16 ***
## Residuals               174  191.6     1.1                   
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
  ## Boxplot
      Overall.Ferm %>%
        ggplot(aes(x = as.factor(Millet.Ratio), y = Rating, color = as.factor(Millet.Ratio))) +
        geom_boxplot() +
        geom_jitter()+
        theme_bw() +
        scale_color_manual(values = c("#FBC02D", "#FBC02D", "#FBC02D", "#FBC02D", "#FBC02D", "#FBC02D"))+
        scale_y_continuous(breaks = seq(0, 9), limits = c(0, 9))+
        ggtitle("Fermented Millet Subsitution Ratio vs Liking")

  ## 0 vs 10
  Overall.Ferm %>% 
    filter(Millet.Ratio%in%c("0", "10")) %>%
    ggplot(aes(x = as.factor(Millet.Ratio), y = Rating, color = as.factor(Millet.Ratio))) +
    geom_boxplot() +    
    geom_jitter()+
    stat_compare_means(paired = TRUE) +
    scale_color_manual(values = c("#AFB42B", "#AFB42B"))+
    theme_bw()

  ## 0 vs 20
    Overall.Ferm %>% 
    filter(Millet.Ratio%in%c("0", "20")) %>%
    ggplot(aes(x = as.factor(Millet.Ratio), y = Rating, color = as.factor(Millet.Ratio))) +
    geom_boxplot() +    
    geom_jitter()+
    stat_compare_means(paired = TRUE) +
    scale_color_manual(values = c("#AFB42B", "#AFB42B"))+
    theme_bw()

  ## 0 vs 30
    Overall.Ferm %>% 
    filter(Millet.Ratio%in%c("0", "30")) %>%
    ggplot(aes(x = as.factor(Millet.Ratio), y = Rating, color = as.factor(Millet.Ratio))) +
    geom_boxplot() +    
    geom_jitter()+
    stat_compare_means(paired = TRUE) +
    scale_color_manual(values = c("#AFB42B", "#AFB42B"))+
    theme_bw()

  ## 0 vs 40
    Overall.Ferm %>% 
    filter(Millet.Ratio %in% c("0", "40")) %>%
    ggplot(aes(x = as.factor(Millet.Ratio), y = Rating, color = as.factor(Millet.Ratio))) +
    geom_boxplot() +    
    geom_jitter()+
    stat_compare_means(paired = TRUE) +
    scale_color_manual(values = c("#AFB42B", "#AFB42B"))+
    theme_bw() 

  ## 0 vs 50
    Overall.Ferm %>% 
    filter(Millet.Ratio%in%c("40", "50")) %>%
    ggplot(aes(x = as.factor(Millet.Ratio), y = Rating, color = as.factor(Millet.Ratio))) +
    geom_boxplot() +    
    geom_jitter()+
    stat_compare_means(paired = TRUE) +
    scale_color_manual(values = c("#AFB42B", "#AFB42B"))+
    theme_bw()

Unfermented vs fermented dose response curve

MilletDose.Overall <- MB.Wide %>%
  mutate(Overall = (Overall_1 + Overall_2) /2) %>%
  group_by(Millet.Ratio, Ferm.Type) %>%
  summarize(Overall = mean(Overall), SD = sd(c(Overall_1 + Overall_2))) %>%
  mutate(Ratio = case_when(Ferm.Type == "Fermented" ~ Millet.Ratio + 1,
                   Ferm.Type == "Unfermented" ~ Millet.Ratio))
## `summarise()` has grouped output by 'Millet.Ratio'. You can override using the `.groups` argument.
MilletDose.Overall %>%
ggplot(aes(x = Ratio, y = Overall, color = Ferm.Type)) +
  geom_point() +
  geom_line(aes(group = Ferm.Type))+
  geom_errorbar(aes(ymin = (Overall - (SD/sqrt(11))), ymax = (Overall + (SD/sqrt(11)))), width = 1) +
  theme_bw() +
  scale_color_manual(values = c("#FBC02D", "#2E7D32"))+
  scale_y_continuous(breaks = seq(0, 9), limits = c(0, 9))

Millet ratio to predict overall liking

## Unfermented
Overall.Unferm <- MB.Long %>%
  filter(Attribute == "Overall") %>%
  filter(Ferm.Type == "Unfermented")

Unferm.lm <- lm(Rating ~ as.numeric(Millet.Ratio), Overall.Unferm)
summary(Unferm.lm)
## 
## Call:
## lm(formula = Rating ~ as.numeric(Millet.Ratio), data = Overall.Unferm)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -4.2976 -0.9219  0.0781  0.8295  3.5810 
## 
## Coefficients:
##                           Estimate Std. Error t value Pr(>|t|)    
## (Intercept)               7.297619   0.088870   82.11   <2e-16 ***
## as.numeric(Millet.Ratio) -0.037571   0.002935  -12.80   <2e-16 ***
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 1.345 on 718 degrees of freedom
## Multiple R-squared:  0.1858, Adjusted R-squared:  0.1847 
## F-statistic: 163.8 on 1 and 718 DF,  p-value: < 2.2e-16
  ## Millet ratio liking function
  Overall.Unferm %>%
    ggplot(aes(x = as.numeric(Millet.Ratio), y = Rating)) +
             geom_jitter() +
             geom_smooth(method = "lm")+
             theme_bw() +
    stat_cor() +
        ggtitle("Unfermented millet sub ratio vs liking")
## `geom_smooth()` using formula 'y ~ x'

## Fermented
Overall.Ferm <- MB.Long %>%
  filter(Attribute == "Overall") %>%
  filter(Ferm.Type == "Fermented")

Ferm.lm <- lm(Rating ~ as.numeric(Millet.Ratio), Overall.Ferm)
summary(Ferm.lm)
## 
## Call:
## lm(formula = Rating ~ as.numeric(Millet.Ratio), data = Overall.Ferm)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -4.5067 -0.8379 -0.1627  1.1621  3.4997 
## 
## Coefficients:
##                           Estimate Std. Error t value Pr(>|t|)    
## (Intercept)               7.506746   0.092716   80.97   <2e-16 ***
## as.numeric(Millet.Ratio) -0.066881   0.003062  -21.84   <2e-16 ***
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 1.403 on 718 degrees of freedom
## Multiple R-squared:  0.3992, Adjusted R-squared:  0.3983 
## F-statistic:   477 on 1 and 718 DF,  p-value: < 2.2e-16
  ## Millet ratio liking function
  Overall.Ferm %>%
    ggplot(aes(x = as.numeric(Millet.Ratio), y = Rating)) +
             geom_jitter() +
             geom_smooth(method = "lm")+
             theme_bw() +
    stat_cor() +
    ggtitle("Fermented millet sub ratio vs liking")
## `geom_smooth()` using formula 'y ~ x'

Difference - Appearance

## Appearance 
Appearance <- MB.Long %>%
  filter(Attribute == "Appearance") 
Appearance.aov <- aov(Rating ~ Ferm.Type*as.factor(Millet.Ratio), Appearance) 
summary(Appearance.aov)
##                                     Df Sum Sq Mean Sq F value Pr(>F)    
## Ferm.Type                            1    6.1    6.14   3.098 0.0786 .  
## as.factor(Millet.Ratio)              5  619.9  123.97  62.598 <2e-16 ***
## Ferm.Type:as.factor(Millet.Ratio)    5   19.8    3.96   1.999 0.0760 .  
## Residuals                         1428 2828.1    1.98                   
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
  ## Scatter plot
  Appearance %>%
    ggplot(aes(x = Millet.Ratio, y = Rating, color = Ferm.Type, group = Ferm.Type)) +
    geom_jitter() +
    geom_smooth(method = "lm")+
    scale_color_manual(values = c("#AFB42B", "#2E7D32"))+
    stat_cor()+
    theme_bw()
## `geom_smooth()` using formula 'y ~ x'

  ## Boxplot
       ## Overall
      Appearance %>%
        ggplot(aes(x = Ferm.Type, y = Rating, color = Ferm.Type)) +
        geom_boxplot() +
        geom_jitter()+
        stat_compare_means(method = "t.test", paired = TRUE) +
        scale_color_manual(values = c("#AFB42B", "#2E7D32"))+
        theme_bw()

      ## Faceted by millet ratio
      Appearance %>%
        ggplot(aes(x = Ferm.Type, y = Rating, color = Ferm.Type)) +
        geom_boxplot() +
        geom_jitter()+
        facet_wrap(~as.factor(Millet.Ratio)) +
        stat_compare_means(method = "t.test", paired = TRUE) +
        scale_color_manual(values = c("#AFB42B", "#2E7D32"))+
        theme_bw()

Difference - Color

## Color 
Color <- MB.Long %>%
  filter(Attribute == "Color") 
Color.aov <- aov(Rating ~ Ferm.Type*as.factor(Millet.Ratio), Color) 
summary(Color.aov)
##                                     Df Sum Sq Mean Sq F value   Pr(>F)    
## Ferm.Type                            1    0.8   0.803   0.501    0.479    
## as.factor(Millet.Ratio)              5  108.2  21.632  13.501 6.86e-13 ***
## Ferm.Type:as.factor(Millet.Ratio)    5   14.1   2.819   1.760    0.118    
## Residuals                         1428 2287.9   1.602                     
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
  ## Scatter plot
  Color %>%
    ggplot(aes(x = Millet.Ratio, y = Rating, color = Ferm.Type, group = Ferm.Type)) +
    geom_jitter() +
    geom_smooth(method = "lm")+
    scale_color_manual(values = c("#AFB42B", "#2E7D32"))+
    stat_cor()+
    theme_bw()
## `geom_smooth()` using formula 'y ~ x'

  ## Boxplot
       ## Overall
      Color %>%
        ggplot(aes(x = Ferm.Type, y = Rating, color = Ferm.Type)) +
        geom_boxplot() +
        geom_jitter()+
        stat_compare_means(method = "t.test", paired = TRUE) +
        scale_color_manual(values = c("#AFB42B", "#2E7D32"))+
        theme_bw()

      ## Faceted by millet ratio
      Color %>%
        ggplot(aes(x = Ferm.Type, y = Rating, color = Ferm.Type)) +
        geom_boxplot() +
        geom_jitter()+
        facet_wrap(~as.factor(Millet.Ratio)) +
        stat_compare_means(method = "t.test", paired = TRUE) +
        scale_color_manual(values = c("#AFB42B", "#2E7D32"))+
        theme_bw()

## Difference - Aroma

## Aroma 
Aroma <- MB.Long %>%
  filter(Attribute == "Aroma") 
Aroma.aov <- aov(Rating ~ Ferm.Type*as.factor(Millet.Ratio), Aroma) 
summary(Aroma.aov)
##                                     Df Sum Sq Mean Sq F value   Pr(>F)    
## Ferm.Type                            1   76.5   76.54   45.89 1.82e-11 ***
## as.factor(Millet.Ratio)              5  165.3   33.05   19.82  < 2e-16 ***
## Ferm.Type:as.factor(Millet.Ratio)    5  113.0   22.61   13.55 6.09e-13 ***
## Residuals                         1428 2381.8    1.67                     
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
  ## Scatter plot
  Aroma %>%
    ggplot(aes(x = Millet.Ratio, y = Rating, color = Ferm.Type, group = Ferm.Type)) +
    geom_jitter() +
    geom_smooth(method = "lm")+
    scale_color_manual(values = c("#AFB42B", "#2E7D32"))+
    stat_cor()+
    theme_bw()
## `geom_smooth()` using formula 'y ~ x'

  ## Boxplot
       ## Overall
      Aroma %>%
        ggplot(aes(x = Ferm.Type, y = Rating, color = Ferm.Type)) +
        geom_boxplot() +
        geom_jitter()+
        stat_compare_means(method = "t.test", paired = TRUE) +
        scale_color_manual(values = c("#AFB42B", "#2E7D32"))+
        theme_bw()

      ## Faceted by millet ratio
      Aroma %>%
        ggplot(aes(x = Ferm.Type, y = Rating, color = Ferm.Type)) +
        geom_boxplot() +
        geom_jitter()+
        facet_wrap(~as.factor(Millet.Ratio)) +
        stat_compare_means(method = "t.test", paired = TRUE) +
        scale_color_manual(values = c("#AFB42B", "#2E7D32"))+
        theme_bw()

## Difference - Texture

## Texture 
Texture <- MB.Long %>%
  filter(Attribute == "Texture") 
Texture.aov <- aov(Rating ~ Ferm.Type*as.factor(Millet.Ratio), Texture) 
summary(Texture.aov)
##                                     Df Sum Sq Mean Sq F value   Pr(>F)    
## Ferm.Type                            1   57.6    57.6  26.973 2.36e-07 ***
## as.factor(Millet.Ratio)              5 2127.6   425.5 199.265  < 2e-16 ***
## Ferm.Type:as.factor(Millet.Ratio)    5   72.2    14.4   6.758 3.09e-06 ***
## Residuals                         1428 3049.4     2.1                     
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
  ## Scatter plot
  Texture %>%
    ggplot(aes(x = Millet.Ratio, y = Rating, color = Ferm.Type, group = Ferm.Type)) +
    geom_jitter() +
    geom_smooth(method = "lm")+
    scale_color_manual(values = c("#AFB42B", "#2E7D32"))+
    stat_cor()+
    theme_bw()
## `geom_smooth()` using formula 'y ~ x'

  ## Boxplot
       ## Overall
      Texture %>%
        ggplot(aes(x = Ferm.Type, y = Rating, color = Ferm.Type)) +
        geom_boxplot() +
        geom_jitter()+
        stat_compare_means(method = "t.test", paired = TRUE) +
        scale_color_manual(values = c("#AFB42B", "#2E7D32"))+
        theme_bw()

      ## Faceted by millet ratio
      Texture %>%
        ggplot(aes(x = Ferm.Type, y = Rating, color = Ferm.Type)) +
        geom_boxplot() +
        geom_jitter()+
        facet_wrap(~as.factor(Millet.Ratio)) +
        stat_compare_means(method = "t.test", paired = TRUE) +
        scale_color_manual(values = c("#AFB42B", "#2E7D32"))+
        theme_bw()

## Difference - Flavor

## Flavor 
Flavor <- MB.Long %>%
  filter(Attribute == "Flavor") 
Flavor.aov <- aov(Rating ~ Ferm.Type*as.factor(Millet.Ratio), Flavor) 
summary(Flavor.aov)
##                                     Df Sum Sq Mean Sq F value   Pr(>F)    
## Ferm.Type                            1   92.5   92.52   47.62 7.74e-12 ***
## as.factor(Millet.Ratio)              5  623.4  124.68   64.18  < 2e-16 ***
## Ferm.Type:as.factor(Millet.Ratio)    5  146.4   29.27   15.07 1.92e-14 ***
## Residuals                         1428 2774.2    1.94                     
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
  ## Scatter plot
  Flavor %>%
    ggplot(aes(x = Millet.Ratio, y = Rating, color = Ferm.Type, group = Ferm.Type)) +
    geom_jitter() +
    geom_smooth(method = "lm")+
    scale_color_manual(values = c("#AFB42B", "#2E7D32"))+
    stat_cor()+
    theme_bw()
## `geom_smooth()` using formula 'y ~ x'

  ## Boxplot
       ## Overall
      Flavor %>%
        ggplot(aes(x = Ferm.Type, y = Rating, color = Ferm.Type)) +
        geom_boxplot() +
        geom_jitter()+
        stat_compare_means(method = "t.test", paired = TRUE) +
        scale_color_manual(values = c("#AFB42B", "#2E7D32"))+
        theme_bw()

      ## Faceted by millet ratio
      Flavor %>%
        ggplot(aes(x = Ferm.Type, y = Rating, color = Ferm.Type)) +
        geom_boxplot() +
        geom_jitter()+
        facet_wrap(~as.factor(Millet.Ratio)) +
        stat_compare_means(method = "t.test", paired = TRUE) +
        scale_color_manual(values = c("#AFB42B", "#2E7D32"))+
        theme_bw()

Acceptability: Logistic regression

## Liking on Acceptability
Decision %>% 
  ggplot(aes(x = as.factor(Acceptability), y = Overall)) +
  geom_jitter(aes(color = Ferm.Type)) +
  geom_boxplot(aes(color = Ferm.Type), alpha = 0.7)+
  scale_color_manual(values = c("#FBC02D", "#2E7D32"))+
  scale_y_continuous(breaks = seq(0, 9), limits = c(0, 9))+
  theme_bw() 
## Warning: Removed 27 rows containing missing values (geom_point).

## Logistic regression
Accept.Mod <- glm(as.factor(Acceptability) ~ Millet.Ratio, family = binomial, data = Decision)
summary(Accept.Mod)
## 
## Call:
## glm(formula = as.factor(Acceptability) ~ Millet.Ratio, family = binomial, 
##     data = Decision)
## 
## Deviance Residuals: 
##     Min       1Q   Median       3Q      Max  
## -1.0595  -0.5596  -0.3934  -0.1895   2.8387  
## 
## Coefficients:
##              Estimate Std. Error z value Pr(>|z|)    
## (Intercept)  -4.01108    0.23352  -17.18   <2e-16 ***
## Millet.Ratio  0.07454    0.00592   12.59   <2e-16 ***
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## (Dispersion parameter for binomial family taken to be 1)
## 
##     Null deviance: 1271.5  on 1439  degrees of freedom
## Residual deviance: 1048.9  on 1438  degrees of freedom
## AIC: 1052.9
## 
## Number of Fisher Scoring iterations: 5

Buy: Logistic regression

## Liking on Acceptability
Decision %>% 
  ggplot(aes(x = as.factor(Buy), y = Overall)) +
  geom_jitter(aes(color = Ferm.Type)) +
  geom_boxplot(aes(color = Ferm.Type), alpha = 0.7)+
  scale_color_manual(values = c("#FBC02D", "#2E7D32"))+
  scale_y_continuous(breaks = seq(0, 9), limits = c(0, 9))+
  theme_bw() 
## Warning: Removed 29 rows containing missing values (geom_point).

## Logistic regression
Buy.Mod <- multinom(as.factor(Buy) ~ Millet.Ratio, data = Decision)
## # weights:  9 (4 variable)
## initial  value 1582.001696 
## iter  10 value 1336.847483
## final  value 1336.846815 
## converged
summary(Buy.Mod)
## Call:
## multinom(formula = as.factor(Buy) ~ Millet.Ratio, data = Decision)
## 
## Coefficients:
##   (Intercept) Millet.Ratio
## 2   -1.200962   0.04325437
## 3   -3.059086   0.09597508
## 
## Std. Errors:
##   (Intercept) Millet.Ratio
## 2   0.1120586  0.004253926
## 3   0.1832462  0.005504098
## 
## Residual Deviance: 2673.694 
## AIC: 2681.694
predict(Buy.Mod, Decision, typ="prob")
##              1         2          3
## 1    0.7419305 0.2232503 0.03481922
## 2    0.7419305 0.2232503 0.03481922
## 3    0.7419305 0.2232503 0.03481922
## 4    0.7419305 0.2232503 0.03481922
## 5    0.7419305 0.2232503 0.03481922
## 6    0.7419305 0.2232503 0.03481922
## 7    0.7419305 0.2232503 0.03481922
## 8    0.7419305 0.2232503 0.03481922
## 9    0.7419305 0.2232503 0.03481922
## 10   0.7419305 0.2232503 0.03481922
## 11   0.7419305 0.2232503 0.03481922
## 12   0.7419305 0.2232503 0.03481922
## 13   0.7419305 0.2232503 0.03481922
## 14   0.7419305 0.2232503 0.03481922
## 15   0.7419305 0.2232503 0.03481922
## 16   0.7419305 0.2232503 0.03481922
## 17   0.7419305 0.2232503 0.03481922
## 18   0.7419305 0.2232503 0.03481922
## 19   0.7419305 0.2232503 0.03481922
## 20   0.7419305 0.2232503 0.03481922
## 21   0.7419305 0.2232503 0.03481922
## 22   0.7419305 0.2232503 0.03481922
## 23   0.7419305 0.2232503 0.03481922
## 24   0.7419305 0.2232503 0.03481922
## 25   0.7419305 0.2232503 0.03481922
## 26   0.7419305 0.2232503 0.03481922
## 27   0.7419305 0.2232503 0.03481922
## 28   0.7419305 0.2232503 0.03481922
## 29   0.7419305 0.2232503 0.03481922
## 30   0.7419305 0.2232503 0.03481922
## 31   0.7419305 0.2232503 0.03481922
## 32   0.7419305 0.2232503 0.03481922
## 33   0.7419305 0.2232503 0.03481922
## 34   0.7419305 0.2232503 0.03481922
## 35   0.7419305 0.2232503 0.03481922
## 36   0.7419305 0.2232503 0.03481922
## 37   0.7419305 0.2232503 0.03481922
## 38   0.7419305 0.2232503 0.03481922
## 39   0.7419305 0.2232503 0.03481922
## 40   0.7419305 0.2232503 0.03481922
## 41   0.7419305 0.2232503 0.03481922
## 42   0.7419305 0.2232503 0.03481922
## 43   0.7419305 0.2232503 0.03481922
## 44   0.7419305 0.2232503 0.03481922
## 45   0.7419305 0.2232503 0.03481922
## 46   0.7419305 0.2232503 0.03481922
## 47   0.7419305 0.2232503 0.03481922
## 48   0.7419305 0.2232503 0.03481922
## 49   0.7419305 0.2232503 0.03481922
## 50   0.7419305 0.2232503 0.03481922
## 51   0.7419305 0.2232503 0.03481922
## 52   0.7419305 0.2232503 0.03481922
## 53   0.7419305 0.2232503 0.03481922
## 54   0.7419305 0.2232503 0.03481922
## 55   0.7419305 0.2232503 0.03481922
## 56   0.7419305 0.2232503 0.03481922
## 57   0.7419305 0.2232503 0.03481922
## 58   0.7419305 0.2232503 0.03481922
## 59   0.7419305 0.2232503 0.03481922
## 60   0.7419305 0.2232503 0.03481922
## 61   0.7419305 0.2232503 0.03481922
## 62   0.7419305 0.2232503 0.03481922
## 63   0.7419305 0.2232503 0.03481922
## 64   0.7419305 0.2232503 0.03481922
## 65   0.7419305 0.2232503 0.03481922
## 66   0.7419305 0.2232503 0.03481922
## 67   0.7419305 0.2232503 0.03481922
## 68   0.7419305 0.2232503 0.03481922
## 69   0.7419305 0.2232503 0.03481922
## 70   0.7419305 0.2232503 0.03481922
## 71   0.7419305 0.2232503 0.03481922
## 72   0.7419305 0.2232503 0.03481922
## 73   0.7419305 0.2232503 0.03481922
## 74   0.7419305 0.2232503 0.03481922
## 75   0.7419305 0.2232503 0.03481922
## 76   0.7419305 0.2232503 0.03481922
## 77   0.7419305 0.2232503 0.03481922
## 78   0.7419305 0.2232503 0.03481922
## 79   0.7419305 0.2232503 0.03481922
## 80   0.7419305 0.2232503 0.03481922
## 81   0.7419305 0.2232503 0.03481922
## 82   0.7419305 0.2232503 0.03481922
## 83   0.7419305 0.2232503 0.03481922
## 84   0.7419305 0.2232503 0.03481922
## 85   0.7419305 0.2232503 0.03481922
## 86   0.7419305 0.2232503 0.03481922
## 87   0.7419305 0.2232503 0.03481922
## 88   0.7419305 0.2232503 0.03481922
## 89   0.7419305 0.2232503 0.03481922
## 90   0.7419305 0.2232503 0.03481922
## 91   0.7419305 0.2232503 0.03481922
## 92   0.7419305 0.2232503 0.03481922
## 93   0.7419305 0.2232503 0.03481922
## 94   0.7419305 0.2232503 0.03481922
## 95   0.7419305 0.2232503 0.03481922
## 96   0.7419305 0.2232503 0.03481922
## 97   0.7419305 0.2232503 0.03481922
## 98   0.7419305 0.2232503 0.03481922
## 99   0.7419305 0.2232503 0.03481922
## 100  0.7419305 0.2232503 0.03481922
## 101  0.7419305 0.2232503 0.03481922
## 102  0.7419305 0.2232503 0.03481922
## 103  0.7419305 0.2232503 0.03481922
## 104  0.7419305 0.2232503 0.03481922
## 105  0.7419305 0.2232503 0.03481922
## 106  0.7419305 0.2232503 0.03481922
## 107  0.7419305 0.2232503 0.03481922
## 108  0.7419305 0.2232503 0.03481922
## 109  0.7419305 0.2232503 0.03481922
## 110  0.7419305 0.2232503 0.03481922
## 111  0.7419305 0.2232503 0.03481922
## 112  0.7419305 0.2232503 0.03481922
## 113  0.7419305 0.2232503 0.03481922
## 114  0.7419305 0.2232503 0.03481922
## 115  0.7419305 0.2232503 0.03481922
## 116  0.7419305 0.2232503 0.03481922
## 117  0.7419305 0.2232503 0.03481922
## 118  0.7419305 0.2232503 0.03481922
## 119  0.7419305 0.2232503 0.03481922
## 120  0.7419305 0.2232503 0.03481922
## 121  0.7419305 0.2232503 0.03481922
## 122  0.7419305 0.2232503 0.03481922
## 123  0.7419305 0.2232503 0.03481922
## 124  0.7419305 0.2232503 0.03481922
## 125  0.7419305 0.2232503 0.03481922
## 126  0.7419305 0.2232503 0.03481922
## 127  0.7419305 0.2232503 0.03481922
## 128  0.7419305 0.2232503 0.03481922
## 129  0.7419305 0.2232503 0.03481922
## 130  0.7419305 0.2232503 0.03481922
## 131  0.7419305 0.2232503 0.03481922
## 132  0.7419305 0.2232503 0.03481922
## 133  0.7419305 0.2232503 0.03481922
## 134  0.7419305 0.2232503 0.03481922
## 135  0.7419305 0.2232503 0.03481922
## 136  0.7419305 0.2232503 0.03481922
## 137  0.7419305 0.2232503 0.03481922
## 138  0.7419305 0.2232503 0.03481922
## 139  0.7419305 0.2232503 0.03481922
## 140  0.7419305 0.2232503 0.03481922
## 141  0.7419305 0.2232503 0.03481922
## 142  0.7419305 0.2232503 0.03481922
## 143  0.7419305 0.2232503 0.03481922
## 144  0.7419305 0.2232503 0.03481922
## 145  0.7419305 0.2232503 0.03481922
## 146  0.7419305 0.2232503 0.03481922
## 147  0.7419305 0.2232503 0.03481922
## 148  0.7419305 0.2232503 0.03481922
## 149  0.7419305 0.2232503 0.03481922
## 150  0.7419305 0.2232503 0.03481922
## 151  0.7419305 0.2232503 0.03481922
## 152  0.7419305 0.2232503 0.03481922
## 153  0.7419305 0.2232503 0.03481922
## 154  0.7419305 0.2232503 0.03481922
## 155  0.7419305 0.2232503 0.03481922
## 156  0.7419305 0.2232503 0.03481922
## 157  0.7419305 0.2232503 0.03481922
## 158  0.7419305 0.2232503 0.03481922
## 159  0.7419305 0.2232503 0.03481922
## 160  0.7419305 0.2232503 0.03481922
## 161  0.7419305 0.2232503 0.03481922
## 162  0.7419305 0.2232503 0.03481922
## 163  0.7419305 0.2232503 0.03481922
## 164  0.7419305 0.2232503 0.03481922
## 165  0.7419305 0.2232503 0.03481922
## 166  0.7419305 0.2232503 0.03481922
## 167  0.7419305 0.2232503 0.03481922
## 168  0.7419305 0.2232503 0.03481922
## 169  0.7419305 0.2232503 0.03481922
## 170  0.7419305 0.2232503 0.03481922
## 171  0.7419305 0.2232503 0.03481922
## 172  0.7419305 0.2232503 0.03481922
## 173  0.7419305 0.2232503 0.03481922
## 174  0.7419305 0.2232503 0.03481922
## 175  0.7419305 0.2232503 0.03481922
## 176  0.7419305 0.2232503 0.03481922
## 177  0.7419305 0.2232503 0.03481922
## 178  0.7419305 0.2232503 0.03481922
## 179  0.7419305 0.2232503 0.03481922
## 180  0.7419305 0.2232503 0.03481922
## 181  0.7419305 0.2232503 0.03481922
## 182  0.7419305 0.2232503 0.03481922
## 183  0.7419305 0.2232503 0.03481922
## 184  0.7419305 0.2232503 0.03481922
## 185  0.7419305 0.2232503 0.03481922
## 186  0.7419305 0.2232503 0.03481922
## 187  0.7419305 0.2232503 0.03481922
## 188  0.7419305 0.2232503 0.03481922
## 189  0.7419305 0.2232503 0.03481922
## 190  0.7419305 0.2232503 0.03481922
## 191  0.7419305 0.2232503 0.03481922
## 192  0.7419305 0.2232503 0.03481922
## 193  0.7419305 0.2232503 0.03481922
## 194  0.7419305 0.2232503 0.03481922
## 195  0.7419305 0.2232503 0.03481922
## 196  0.7419305 0.2232503 0.03481922
## 197  0.7419305 0.2232503 0.03481922
## 198  0.7419305 0.2232503 0.03481922
## 199  0.7419305 0.2232503 0.03481922
## 200  0.7419305 0.2232503 0.03481922
## 201  0.7419305 0.2232503 0.03481922
## 202  0.7419305 0.2232503 0.03481922
## 203  0.7419305 0.2232503 0.03481922
## 204  0.7419305 0.2232503 0.03481922
## 205  0.7419305 0.2232503 0.03481922
## 206  0.7419305 0.2232503 0.03481922
## 207  0.7419305 0.2232503 0.03481922
## 208  0.7419305 0.2232503 0.03481922
## 209  0.7419305 0.2232503 0.03481922
## 210  0.7419305 0.2232503 0.03481922
## 211  0.7419305 0.2232503 0.03481922
## 212  0.7419305 0.2232503 0.03481922
## 213  0.7419305 0.2232503 0.03481922
## 214  0.7419305 0.2232503 0.03481922
## 215  0.7419305 0.2232503 0.03481922
## 216  0.7419305 0.2232503 0.03481922
## 217  0.7419305 0.2232503 0.03481922
## 218  0.7419305 0.2232503 0.03481922
## 219  0.7419305 0.2232503 0.03481922
## 220  0.7419305 0.2232503 0.03481922
## 221  0.7419305 0.2232503 0.03481922
## 222  0.7419305 0.2232503 0.03481922
## 223  0.7419305 0.2232503 0.03481922
## 224  0.7419305 0.2232503 0.03481922
## 225  0.7419305 0.2232503 0.03481922
## 226  0.7419305 0.2232503 0.03481922
## 227  0.7419305 0.2232503 0.03481922
## 228  0.7419305 0.2232503 0.03481922
## 229  0.7419305 0.2232503 0.03481922
## 230  0.7419305 0.2232503 0.03481922
## 231  0.7419305 0.2232503 0.03481922
## 232  0.7419305 0.2232503 0.03481922
## 233  0.7419305 0.2232503 0.03481922
## 234  0.7419305 0.2232503 0.03481922
## 235  0.7419305 0.2232503 0.03481922
## 236  0.7419305 0.2232503 0.03481922
## 237  0.7419305 0.2232503 0.03481922
## 238  0.7419305 0.2232503 0.03481922
## 239  0.7419305 0.2232503 0.03481922
## 240  0.7419305 0.2232503 0.03481922
## 241  0.6304042 0.2923475 0.07724838
## 242  0.6304042 0.2923475 0.07724838
## 243  0.6304042 0.2923475 0.07724838
## 244  0.6304042 0.2923475 0.07724838
## 245  0.6304042 0.2923475 0.07724838
## 246  0.6304042 0.2923475 0.07724838
## 247  0.6304042 0.2923475 0.07724838
## 248  0.6304042 0.2923475 0.07724838
## 249  0.6304042 0.2923475 0.07724838
## 250  0.6304042 0.2923475 0.07724838
## 251  0.6304042 0.2923475 0.07724838
## 252  0.6304042 0.2923475 0.07724838
## 253  0.6304042 0.2923475 0.07724838
## 254  0.6304042 0.2923475 0.07724838
## 255  0.6304042 0.2923475 0.07724838
## 256  0.6304042 0.2923475 0.07724838
## 257  0.6304042 0.2923475 0.07724838
## 258  0.6304042 0.2923475 0.07724838
## 259  0.6304042 0.2923475 0.07724838
## 260  0.6304042 0.2923475 0.07724838
## 261  0.6304042 0.2923475 0.07724838
## 262  0.6304042 0.2923475 0.07724838
## 263  0.6304042 0.2923475 0.07724838
## 264  0.6304042 0.2923475 0.07724838
## 265  0.6304042 0.2923475 0.07724838
## 266  0.6304042 0.2923475 0.07724838
## 267  0.6304042 0.2923475 0.07724838
## 268  0.6304042 0.2923475 0.07724838
## 269  0.6304042 0.2923475 0.07724838
## 270  0.6304042 0.2923475 0.07724838
## 271  0.6304042 0.2923475 0.07724838
## 272  0.6304042 0.2923475 0.07724838
## 273  0.6304042 0.2923475 0.07724838
## 274  0.6304042 0.2923475 0.07724838
## 275  0.6304042 0.2923475 0.07724838
## 276  0.6304042 0.2923475 0.07724838
## 277  0.6304042 0.2923475 0.07724838
## 278  0.6304042 0.2923475 0.07724838
## 279  0.6304042 0.2923475 0.07724838
## 280  0.6304042 0.2923475 0.07724838
## 281  0.6304042 0.2923475 0.07724838
## 282  0.6304042 0.2923475 0.07724838
## 283  0.6304042 0.2923475 0.07724838
## 284  0.6304042 0.2923475 0.07724838
## 285  0.6304042 0.2923475 0.07724838
## 286  0.6304042 0.2923475 0.07724838
## 287  0.6304042 0.2923475 0.07724838
## 288  0.6304042 0.2923475 0.07724838
## 289  0.6304042 0.2923475 0.07724838
## 290  0.6304042 0.2923475 0.07724838
## 291  0.6304042 0.2923475 0.07724838
## 292  0.6304042 0.2923475 0.07724838
## 293  0.6304042 0.2923475 0.07724838
## 294  0.6304042 0.2923475 0.07724838
## 295  0.6304042 0.2923475 0.07724838
## 296  0.6304042 0.2923475 0.07724838
## 297  0.6304042 0.2923475 0.07724838
## 298  0.6304042 0.2923475 0.07724838
## 299  0.6304042 0.2923475 0.07724838
## 300  0.6304042 0.2923475 0.07724838
## 301  0.6304042 0.2923475 0.07724838
## 302  0.6304042 0.2923475 0.07724838
## 303  0.6304042 0.2923475 0.07724838
## 304  0.6304042 0.2923475 0.07724838
## 305  0.6304042 0.2923475 0.07724838
## 306  0.6304042 0.2923475 0.07724838
## 307  0.6304042 0.2923475 0.07724838
## 308  0.6304042 0.2923475 0.07724838
## 309  0.6304042 0.2923475 0.07724838
## 310  0.6304042 0.2923475 0.07724838
## 311  0.6304042 0.2923475 0.07724838
## 312  0.6304042 0.2923475 0.07724838
## 313  0.6304042 0.2923475 0.07724838
## 314  0.6304042 0.2923475 0.07724838
## 315  0.6304042 0.2923475 0.07724838
## 316  0.6304042 0.2923475 0.07724838
## 317  0.6304042 0.2923475 0.07724838
## 318  0.6304042 0.2923475 0.07724838
## 319  0.6304042 0.2923475 0.07724838
## 320  0.6304042 0.2923475 0.07724838
## 321  0.6304042 0.2923475 0.07724838
## 322  0.6304042 0.2923475 0.07724838
## 323  0.6304042 0.2923475 0.07724838
## 324  0.6304042 0.2923475 0.07724838
## 325  0.6304042 0.2923475 0.07724838
## 326  0.6304042 0.2923475 0.07724838
## 327  0.6304042 0.2923475 0.07724838
## 328  0.6304042 0.2923475 0.07724838
## 329  0.6304042 0.2923475 0.07724838
## 330  0.6304042 0.2923475 0.07724838
## 331  0.6304042 0.2923475 0.07724838
## 332  0.6304042 0.2923475 0.07724838
## 333  0.6304042 0.2923475 0.07724838
## 334  0.6304042 0.2923475 0.07724838
## 335  0.6304042 0.2923475 0.07724838
## 336  0.6304042 0.2923475 0.07724838
## 337  0.6304042 0.2923475 0.07724838
## 338  0.6304042 0.2923475 0.07724838
## 339  0.6304042 0.2923475 0.07724838
## 340  0.6304042 0.2923475 0.07724838
## 341  0.6304042 0.2923475 0.07724838
## 342  0.6304042 0.2923475 0.07724838
## 343  0.6304042 0.2923475 0.07724838
## 344  0.6304042 0.2923475 0.07724838
## 345  0.6304042 0.2923475 0.07724838
## 346  0.6304042 0.2923475 0.07724838
## 347  0.6304042 0.2923475 0.07724838
## 348  0.6304042 0.2923475 0.07724838
## 349  0.6304042 0.2923475 0.07724838
## 350  0.6304042 0.2923475 0.07724838
## 351  0.6304042 0.2923475 0.07724838
## 352  0.6304042 0.2923475 0.07724838
## 353  0.6304042 0.2923475 0.07724838
## 354  0.6304042 0.2923475 0.07724838
## 355  0.6304042 0.2923475 0.07724838
## 356  0.6304042 0.2923475 0.07724838
## 357  0.6304042 0.2923475 0.07724838
## 358  0.6304042 0.2923475 0.07724838
## 359  0.6304042 0.2923475 0.07724838
## 360  0.6304042 0.2923475 0.07724838
## 361  0.6304042 0.2923475 0.07724838
## 362  0.6304042 0.2923475 0.07724838
## 363  0.6304042 0.2923475 0.07724838
## 364  0.6304042 0.2923475 0.07724838
## 365  0.6304042 0.2923475 0.07724838
## 366  0.6304042 0.2923475 0.07724838
## 367  0.6304042 0.2923475 0.07724838
## 368  0.6304042 0.2923475 0.07724838
## 369  0.6304042 0.2923475 0.07724838
## 370  0.6304042 0.2923475 0.07724838
## 371  0.6304042 0.2923475 0.07724838
## 372  0.6304042 0.2923475 0.07724838
## 373  0.6304042 0.2923475 0.07724838
## 374  0.6304042 0.2923475 0.07724838
## 375  0.6304042 0.2923475 0.07724838
## 376  0.6304042 0.2923475 0.07724838
## 377  0.6304042 0.2923475 0.07724838
## 378  0.6304042 0.2923475 0.07724838
## 379  0.6304042 0.2923475 0.07724838
## 380  0.6304042 0.2923475 0.07724838
## 381  0.6304042 0.2923475 0.07724838
## 382  0.6304042 0.2923475 0.07724838
## 383  0.6304042 0.2923475 0.07724838
## 384  0.6304042 0.2923475 0.07724838
## 385  0.6304042 0.2923475 0.07724838
## 386  0.6304042 0.2923475 0.07724838
## 387  0.6304042 0.2923475 0.07724838
## 388  0.6304042 0.2923475 0.07724838
## 389  0.6304042 0.2923475 0.07724838
## 390  0.6304042 0.2923475 0.07724838
## 391  0.6304042 0.2923475 0.07724838
## 392  0.6304042 0.2923475 0.07724838
## 393  0.6304042 0.2923475 0.07724838
## 394  0.6304042 0.2923475 0.07724838
## 395  0.6304042 0.2923475 0.07724838
## 396  0.6304042 0.2923475 0.07724838
## 397  0.6304042 0.2923475 0.07724838
## 398  0.6304042 0.2923475 0.07724838
## 399  0.6304042 0.2923475 0.07724838
## 400  0.6304042 0.2923475 0.07724838
## 401  0.6304042 0.2923475 0.07724838
## 402  0.6304042 0.2923475 0.07724838
## 403  0.6304042 0.2923475 0.07724838
## 404  0.6304042 0.2923475 0.07724838
## 405  0.6304042 0.2923475 0.07724838
## 406  0.6304042 0.2923475 0.07724838
## 407  0.6304042 0.2923475 0.07724838
## 408  0.6304042 0.2923475 0.07724838
## 409  0.6304042 0.2923475 0.07724838
## 410  0.6304042 0.2923475 0.07724838
## 411  0.6304042 0.2923475 0.07724838
## 412  0.6304042 0.2923475 0.07724838
## 413  0.6304042 0.2923475 0.07724838
## 414  0.6304042 0.2923475 0.07724838
## 415  0.6304042 0.2923475 0.07724838
## 416  0.6304042 0.2923475 0.07724838
## 417  0.6304042 0.2923475 0.07724838
## 418  0.6304042 0.2923475 0.07724838
## 419  0.6304042 0.2923475 0.07724838
## 420  0.6304042 0.2923475 0.07724838
## 421  0.6304042 0.2923475 0.07724838
## 422  0.6304042 0.2923475 0.07724838
## 423  0.6304042 0.2923475 0.07724838
## 424  0.6304042 0.2923475 0.07724838
## 425  0.6304042 0.2923475 0.07724838
## 426  0.6304042 0.2923475 0.07724838
## 427  0.6304042 0.2923475 0.07724838
## 428  0.6304042 0.2923475 0.07724838
## 429  0.6304042 0.2923475 0.07724838
## 430  0.6304042 0.2923475 0.07724838
## 431  0.6304042 0.2923475 0.07724838
## 432  0.6304042 0.2923475 0.07724838
## 433  0.6304042 0.2923475 0.07724838
## 434  0.6304042 0.2923475 0.07724838
## 435  0.6304042 0.2923475 0.07724838
## 436  0.6304042 0.2923475 0.07724838
## 437  0.6304042 0.2923475 0.07724838
## 438  0.6304042 0.2923475 0.07724838
## 439  0.6304042 0.2923475 0.07724838
## 440  0.6304042 0.2923475 0.07724838
## 441  0.6304042 0.2923475 0.07724838
## 442  0.6304042 0.2923475 0.07724838
## 443  0.6304042 0.2923475 0.07724838
## 444  0.6304042 0.2923475 0.07724838
## 445  0.6304042 0.2923475 0.07724838
## 446  0.6304042 0.2923475 0.07724838
## 447  0.6304042 0.2923475 0.07724838
## 448  0.6304042 0.2923475 0.07724838
## 449  0.6304042 0.2923475 0.07724838
## 450  0.6304042 0.2923475 0.07724838
## 451  0.6304042 0.2923475 0.07724838
## 452  0.6304042 0.2923475 0.07724838
## 453  0.6304042 0.2923475 0.07724838
## 454  0.6304042 0.2923475 0.07724838
## 455  0.6304042 0.2923475 0.07724838
## 456  0.6304042 0.2923475 0.07724838
## 457  0.6304042 0.2923475 0.07724838
## 458  0.6304042 0.2923475 0.07724838
## 459  0.6304042 0.2923475 0.07724838
## 460  0.6304042 0.2923475 0.07724838
## 461  0.6304042 0.2923475 0.07724838
## 462  0.6304042 0.2923475 0.07724838
## 463  0.6304042 0.2923475 0.07724838
## 464  0.6304042 0.2923475 0.07724838
## 465  0.6304042 0.2923475 0.07724838
## 466  0.6304042 0.2923475 0.07724838
## 467  0.6304042 0.2923475 0.07724838
## 468  0.6304042 0.2923475 0.07724838
## 469  0.6304042 0.2923475 0.07724838
## 470  0.6304042 0.2923475 0.07724838
## 471  0.6304042 0.2923475 0.07724838
## 472  0.6304042 0.2923475 0.07724838
## 473  0.6304042 0.2923475 0.07724838
## 474  0.6304042 0.2923475 0.07724838
## 475  0.6304042 0.2923475 0.07724838
## 476  0.6304042 0.2923475 0.07724838
## 477  0.6304042 0.2923475 0.07724838
## 478  0.6304042 0.2923475 0.07724838
## 479  0.6304042 0.2923475 0.07724838
## 480  0.6304042 0.2923475 0.07724838
## 481  0.4914814 0.3512681 0.15725045
## 482  0.4914814 0.3512681 0.15725045
## 483  0.4914814 0.3512681 0.15725045
## 484  0.4914814 0.3512681 0.15725045
## 485  0.4914814 0.3512681 0.15725045
## 486  0.4914814 0.3512681 0.15725045
## 487  0.4914814 0.3512681 0.15725045
## 488  0.4914814 0.3512681 0.15725045
## 489  0.4914814 0.3512681 0.15725045
## 490  0.4914814 0.3512681 0.15725045
## 491  0.4914814 0.3512681 0.15725045
## 492  0.4914814 0.3512681 0.15725045
## 493  0.4914814 0.3512681 0.15725045
## 494  0.4914814 0.3512681 0.15725045
## 495  0.4914814 0.3512681 0.15725045
## 496  0.4914814 0.3512681 0.15725045
## 497  0.4914814 0.3512681 0.15725045
## 498  0.4914814 0.3512681 0.15725045
## 499  0.4914814 0.3512681 0.15725045
## 500  0.4914814 0.3512681 0.15725045
## 501  0.4914814 0.3512681 0.15725045
## 502  0.4914814 0.3512681 0.15725045
## 503  0.4914814 0.3512681 0.15725045
## 504  0.4914814 0.3512681 0.15725045
## 505  0.4914814 0.3512681 0.15725045
## 506  0.4914814 0.3512681 0.15725045
## 507  0.4914814 0.3512681 0.15725045
## 508  0.4914814 0.3512681 0.15725045
## 509  0.4914814 0.3512681 0.15725045
## 510  0.4914814 0.3512681 0.15725045
## 511  0.4914814 0.3512681 0.15725045
## 512  0.4914814 0.3512681 0.15725045
## 513  0.4914814 0.3512681 0.15725045
## 514  0.4914814 0.3512681 0.15725045
## 515  0.4914814 0.3512681 0.15725045
## 516  0.4914814 0.3512681 0.15725045
## 517  0.4914814 0.3512681 0.15725045
## 518  0.4914814 0.3512681 0.15725045
## 519  0.4914814 0.3512681 0.15725045
## 520  0.4914814 0.3512681 0.15725045
## 521  0.4914814 0.3512681 0.15725045
## 522  0.4914814 0.3512681 0.15725045
## 523  0.4914814 0.3512681 0.15725045
## 524  0.4914814 0.3512681 0.15725045
## 525  0.4914814 0.3512681 0.15725045
## 526  0.4914814 0.3512681 0.15725045
## 527  0.4914814 0.3512681 0.15725045
## 528  0.4914814 0.3512681 0.15725045
## 529  0.4914814 0.3512681 0.15725045
## 530  0.4914814 0.3512681 0.15725045
## 531  0.4914814 0.3512681 0.15725045
## 532  0.4914814 0.3512681 0.15725045
## 533  0.4914814 0.3512681 0.15725045
## 534  0.4914814 0.3512681 0.15725045
## 535  0.4914814 0.3512681 0.15725045
## 536  0.4914814 0.3512681 0.15725045
## 537  0.4914814 0.3512681 0.15725045
## 538  0.4914814 0.3512681 0.15725045
## 539  0.4914814 0.3512681 0.15725045
## 540  0.4914814 0.3512681 0.15725045
## 541  0.4914814 0.3512681 0.15725045
## 542  0.4914814 0.3512681 0.15725045
## 543  0.4914814 0.3512681 0.15725045
## 544  0.4914814 0.3512681 0.15725045
## 545  0.4914814 0.3512681 0.15725045
## 546  0.4914814 0.3512681 0.15725045
## 547  0.4914814 0.3512681 0.15725045
## 548  0.4914814 0.3512681 0.15725045
## 549  0.4914814 0.3512681 0.15725045
## 550  0.4914814 0.3512681 0.15725045
## 551  0.4914814 0.3512681 0.15725045
## 552  0.4914814 0.3512681 0.15725045
## 553  0.4914814 0.3512681 0.15725045
## 554  0.4914814 0.3512681 0.15725045
## 555  0.4914814 0.3512681 0.15725045
## 556  0.4914814 0.3512681 0.15725045
## 557  0.4914814 0.3512681 0.15725045
## 558  0.4914814 0.3512681 0.15725045
## 559  0.4914814 0.3512681 0.15725045
## 560  0.4914814 0.3512681 0.15725045
## 561  0.4914814 0.3512681 0.15725045
## 562  0.4914814 0.3512681 0.15725045
## 563  0.4914814 0.3512681 0.15725045
## 564  0.4914814 0.3512681 0.15725045
## 565  0.4914814 0.3512681 0.15725045
## 566  0.4914814 0.3512681 0.15725045
## 567  0.4914814 0.3512681 0.15725045
## 568  0.4914814 0.3512681 0.15725045
## 569  0.4914814 0.3512681 0.15725045
## 570  0.4914814 0.3512681 0.15725045
## 571  0.4914814 0.3512681 0.15725045
## 572  0.4914814 0.3512681 0.15725045
## 573  0.4914814 0.3512681 0.15725045
## 574  0.4914814 0.3512681 0.15725045
## 575  0.4914814 0.3512681 0.15725045
## 576  0.4914814 0.3512681 0.15725045
## 577  0.4914814 0.3512681 0.15725045
## 578  0.4914814 0.3512681 0.15725045
## 579  0.4914814 0.3512681 0.15725045
## 580  0.4914814 0.3512681 0.15725045
## 581  0.4914814 0.3512681 0.15725045
## 582  0.4914814 0.3512681 0.15725045
## 583  0.4914814 0.3512681 0.15725045
## 584  0.4914814 0.3512681 0.15725045
## 585  0.4914814 0.3512681 0.15725045
## 586  0.4914814 0.3512681 0.15725045
## 587  0.4914814 0.3512681 0.15725045
## 588  0.4914814 0.3512681 0.15725045
## 589  0.4914814 0.3512681 0.15725045
## 590  0.4914814 0.3512681 0.15725045
## 591  0.4914814 0.3512681 0.15725045
## 592  0.4914814 0.3512681 0.15725045
## 593  0.4914814 0.3512681 0.15725045
## 594  0.4914814 0.3512681 0.15725045
## 595  0.4914814 0.3512681 0.15725045
## 596  0.4914814 0.3512681 0.15725045
## 597  0.4914814 0.3512681 0.15725045
## 598  0.4914814 0.3512681 0.15725045
## 599  0.4914814 0.3512681 0.15725045
## 600  0.4914814 0.3512681 0.15725045
## 601  0.4914814 0.3512681 0.15725045
## 602  0.4914814 0.3512681 0.15725045
## 603  0.4914814 0.3512681 0.15725045
## 604  0.4914814 0.3512681 0.15725045
## 605  0.4914814 0.3512681 0.15725045
## 606  0.4914814 0.3512681 0.15725045
## 607  0.4914814 0.3512681 0.15725045
## 608  0.4914814 0.3512681 0.15725045
## 609  0.4914814 0.3512681 0.15725045
## 610  0.4914814 0.3512681 0.15725045
## 611  0.4914814 0.3512681 0.15725045
## 612  0.4914814 0.3512681 0.15725045
## 613  0.4914814 0.3512681 0.15725045
## 614  0.4914814 0.3512681 0.15725045
## 615  0.4914814 0.3512681 0.15725045
## 616  0.4914814 0.3512681 0.15725045
## 617  0.4914814 0.3512681 0.15725045
## 618  0.4914814 0.3512681 0.15725045
## 619  0.4914814 0.3512681 0.15725045
## 620  0.4914814 0.3512681 0.15725045
## 621  0.4914814 0.3512681 0.15725045
## 622  0.4914814 0.3512681 0.15725045
## 623  0.4914814 0.3512681 0.15725045
## 624  0.4914814 0.3512681 0.15725045
## 625  0.4914814 0.3512681 0.15725045
## 626  0.4914814 0.3512681 0.15725045
## 627  0.4914814 0.3512681 0.15725045
## 628  0.4914814 0.3512681 0.15725045
## 629  0.4914814 0.3512681 0.15725045
## 630  0.4914814 0.3512681 0.15725045
## 631  0.4914814 0.3512681 0.15725045
## 632  0.4914814 0.3512681 0.15725045
## 633  0.4914814 0.3512681 0.15725045
## 634  0.4914814 0.3512681 0.15725045
## 635  0.4914814 0.3512681 0.15725045
## 636  0.4914814 0.3512681 0.15725045
## 637  0.4914814 0.3512681 0.15725045
## 638  0.4914814 0.3512681 0.15725045
## 639  0.4914814 0.3512681 0.15725045
## 640  0.4914814 0.3512681 0.15725045
## 641  0.4914814 0.3512681 0.15725045
## 642  0.4914814 0.3512681 0.15725045
## 643  0.4914814 0.3512681 0.15725045
## 644  0.4914814 0.3512681 0.15725045
## 645  0.4914814 0.3512681 0.15725045
## 646  0.4914814 0.3512681 0.15725045
## 647  0.4914814 0.3512681 0.15725045
## 648  0.4914814 0.3512681 0.15725045
## 649  0.4914814 0.3512681 0.15725045
## 650  0.4914814 0.3512681 0.15725045
## 651  0.4914814 0.3512681 0.15725045
## 652  0.4914814 0.3512681 0.15725045
## 653  0.4914814 0.3512681 0.15725045
## 654  0.4914814 0.3512681 0.15725045
## 655  0.4914814 0.3512681 0.15725045
## 656  0.4914814 0.3512681 0.15725045
## 657  0.4914814 0.3512681 0.15725045
## 658  0.4914814 0.3512681 0.15725045
## 659  0.4914814 0.3512681 0.15725045
## 660  0.4914814 0.3512681 0.15725045
## 661  0.4914814 0.3512681 0.15725045
## 662  0.4914814 0.3512681 0.15725045
## 663  0.4914814 0.3512681 0.15725045
## 664  0.4914814 0.3512681 0.15725045
## 665  0.4914814 0.3512681 0.15725045
## 666  0.4914814 0.3512681 0.15725045
## 667  0.4914814 0.3512681 0.15725045
## 668  0.4914814 0.3512681 0.15725045
## 669  0.4914814 0.3512681 0.15725045
## 670  0.4914814 0.3512681 0.15725045
## 671  0.4914814 0.3512681 0.15725045
## 672  0.4914814 0.3512681 0.15725045
## 673  0.4914814 0.3512681 0.15725045
## 674  0.4914814 0.3512681 0.15725045
## 675  0.4914814 0.3512681 0.15725045
## 676  0.4914814 0.3512681 0.15725045
## 677  0.4914814 0.3512681 0.15725045
## 678  0.4914814 0.3512681 0.15725045
## 679  0.4914814 0.3512681 0.15725045
## 680  0.4914814 0.3512681 0.15725045
## 681  0.4914814 0.3512681 0.15725045
## 682  0.4914814 0.3512681 0.15725045
## 683  0.4914814 0.3512681 0.15725045
## 684  0.4914814 0.3512681 0.15725045
## 685  0.4914814 0.3512681 0.15725045
## 686  0.4914814 0.3512681 0.15725045
## 687  0.4914814 0.3512681 0.15725045
## 688  0.4914814 0.3512681 0.15725045
## 689  0.4914814 0.3512681 0.15725045
## 690  0.4914814 0.3512681 0.15725045
## 691  0.4914814 0.3512681 0.15725045
## 692  0.4914814 0.3512681 0.15725045
## 693  0.4914814 0.3512681 0.15725045
## 694  0.4914814 0.3512681 0.15725045
## 695  0.4914814 0.3512681 0.15725045
## 696  0.4914814 0.3512681 0.15725045
## 697  0.4914814 0.3512681 0.15725045
## 698  0.4914814 0.3512681 0.15725045
## 699  0.4914814 0.3512681 0.15725045
## 700  0.4914814 0.3512681 0.15725045
## 701  0.4914814 0.3512681 0.15725045
## 702  0.4914814 0.3512681 0.15725045
## 703  0.4914814 0.3512681 0.15725045
## 704  0.4914814 0.3512681 0.15725045
## 705  0.4914814 0.3512681 0.15725045
## 706  0.4914814 0.3512681 0.15725045
## 707  0.4914814 0.3512681 0.15725045
## 708  0.4914814 0.3512681 0.15725045
## 709  0.4914814 0.3512681 0.15725045
## 710  0.4914814 0.3512681 0.15725045
## 711  0.4914814 0.3512681 0.15725045
## 712  0.4914814 0.3512681 0.15725045
## 713  0.4914814 0.3512681 0.15725045
## 714  0.4914814 0.3512681 0.15725045
## 715  0.4914814 0.3512681 0.15725045
## 716  0.4914814 0.3512681 0.15725045
## 717  0.4914814 0.3512681 0.15725045
## 718  0.4914814 0.3512681 0.15725045
## 719  0.4914814 0.3512681 0.15725045
## 720  0.4914814 0.3512681 0.15725045
## 721  0.3404945 0.3750533 0.28445220
## 722  0.3404945 0.3750533 0.28445220
## 723  0.3404945 0.3750533 0.28445220
## 724  0.3404945 0.3750533 0.28445220
## 725  0.3404945 0.3750533 0.28445220
## 726  0.3404945 0.3750533 0.28445220
## 727  0.3404945 0.3750533 0.28445220
## 728  0.3404945 0.3750533 0.28445220
## 729  0.3404945 0.3750533 0.28445220
## 730  0.3404945 0.3750533 0.28445220
## 731  0.3404945 0.3750533 0.28445220
## 732  0.3404945 0.3750533 0.28445220
## 733  0.3404945 0.3750533 0.28445220
## 734  0.3404945 0.3750533 0.28445220
## 735  0.3404945 0.3750533 0.28445220
## 736  0.3404945 0.3750533 0.28445220
## 737  0.3404945 0.3750533 0.28445220
## 738  0.3404945 0.3750533 0.28445220
## 739  0.3404945 0.3750533 0.28445220
## 740  0.3404945 0.3750533 0.28445220
## 741  0.3404945 0.3750533 0.28445220
## 742  0.3404945 0.3750533 0.28445220
## 743  0.3404945 0.3750533 0.28445220
## 744  0.3404945 0.3750533 0.28445220
## 745  0.3404945 0.3750533 0.28445220
## 746  0.3404945 0.3750533 0.28445220
## 747  0.3404945 0.3750533 0.28445220
## 748  0.3404945 0.3750533 0.28445220
## 749  0.3404945 0.3750533 0.28445220
## 750  0.3404945 0.3750533 0.28445220
## 751  0.3404945 0.3750533 0.28445220
## 752  0.3404945 0.3750533 0.28445220
## 753  0.3404945 0.3750533 0.28445220
## 754  0.3404945 0.3750533 0.28445220
## 755  0.3404945 0.3750533 0.28445220
## 756  0.3404945 0.3750533 0.28445220
## 757  0.3404945 0.3750533 0.28445220
## 758  0.3404945 0.3750533 0.28445220
## 759  0.3404945 0.3750533 0.28445220
## 760  0.3404945 0.3750533 0.28445220
## 761  0.3404945 0.3750533 0.28445220
## 762  0.3404945 0.3750533 0.28445220
## 763  0.3404945 0.3750533 0.28445220
## 764  0.3404945 0.3750533 0.28445220
## 765  0.3404945 0.3750533 0.28445220
## 766  0.3404945 0.3750533 0.28445220
## 767  0.3404945 0.3750533 0.28445220
## 768  0.3404945 0.3750533 0.28445220
## 769  0.3404945 0.3750533 0.28445220
## 770  0.3404945 0.3750533 0.28445220
## 771  0.3404945 0.3750533 0.28445220
## 772  0.3404945 0.3750533 0.28445220
## 773  0.3404945 0.3750533 0.28445220
## 774  0.3404945 0.3750533 0.28445220
## 775  0.3404945 0.3750533 0.28445220
## 776  0.3404945 0.3750533 0.28445220
## 777  0.3404945 0.3750533 0.28445220
## 778  0.3404945 0.3750533 0.28445220
## 779  0.3404945 0.3750533 0.28445220
## 780  0.3404945 0.3750533 0.28445220
## 781  0.3404945 0.3750533 0.28445220
## 782  0.3404945 0.3750533 0.28445220
## 783  0.3404945 0.3750533 0.28445220
## 784  0.3404945 0.3750533 0.28445220
## 785  0.3404945 0.3750533 0.28445220
## 786  0.3404945 0.3750533 0.28445220
## 787  0.3404945 0.3750533 0.28445220
## 788  0.3404945 0.3750533 0.28445220
## 789  0.3404945 0.3750533 0.28445220
## 790  0.3404945 0.3750533 0.28445220
## 791  0.3404945 0.3750533 0.28445220
## 792  0.3404945 0.3750533 0.28445220
## 793  0.3404945 0.3750533 0.28445220
## 794  0.3404945 0.3750533 0.28445220
## 795  0.3404945 0.3750533 0.28445220
## 796  0.3404945 0.3750533 0.28445220
## 797  0.3404945 0.3750533 0.28445220
## 798  0.3404945 0.3750533 0.28445220
## 799  0.3404945 0.3750533 0.28445220
## 800  0.3404945 0.3750533 0.28445220
## 801  0.3404945 0.3750533 0.28445220
## 802  0.3404945 0.3750533 0.28445220
## 803  0.3404945 0.3750533 0.28445220
## 804  0.3404945 0.3750533 0.28445220
## 805  0.3404945 0.3750533 0.28445220
## 806  0.3404945 0.3750533 0.28445220
## 807  0.3404945 0.3750533 0.28445220
## 808  0.3404945 0.3750533 0.28445220
## 809  0.3404945 0.3750533 0.28445220
## 810  0.3404945 0.3750533 0.28445220
## 811  0.3404945 0.3750533 0.28445220
## 812  0.3404945 0.3750533 0.28445220
## 813  0.3404945 0.3750533 0.28445220
## 814  0.3404945 0.3750533 0.28445220
## 815  0.3404945 0.3750533 0.28445220
## 816  0.3404945 0.3750533 0.28445220
## 817  0.3404945 0.3750533 0.28445220
## 818  0.3404945 0.3750533 0.28445220
## 819  0.3404945 0.3750533 0.28445220
## 820  0.3404945 0.3750533 0.28445220
## 821  0.3404945 0.3750533 0.28445220
## 822  0.3404945 0.3750533 0.28445220
## 823  0.3404945 0.3750533 0.28445220
## 824  0.3404945 0.3750533 0.28445220
## 825  0.3404945 0.3750533 0.28445220
## 826  0.3404945 0.3750533 0.28445220
## 827  0.3404945 0.3750533 0.28445220
## 828  0.3404945 0.3750533 0.28445220
## 829  0.3404945 0.3750533 0.28445220
## 830  0.3404945 0.3750533 0.28445220
## 831  0.3404945 0.3750533 0.28445220
## 832  0.3404945 0.3750533 0.28445220
## 833  0.3404945 0.3750533 0.28445220
## 834  0.3404945 0.3750533 0.28445220
## 835  0.3404945 0.3750533 0.28445220
## 836  0.3404945 0.3750533 0.28445220
## 837  0.3404945 0.3750533 0.28445220
## 838  0.3404945 0.3750533 0.28445220
## 839  0.3404945 0.3750533 0.28445220
## 840  0.3404945 0.3750533 0.28445220
## 841  0.3404945 0.3750533 0.28445220
## 842  0.3404945 0.3750533 0.28445220
## 843  0.3404945 0.3750533 0.28445220
## 844  0.3404945 0.3750533 0.28445220
## 845  0.3404945 0.3750533 0.28445220
## 846  0.3404945 0.3750533 0.28445220
## 847  0.3404945 0.3750533 0.28445220
## 848  0.3404945 0.3750533 0.28445220
## 849  0.3404945 0.3750533 0.28445220
## 850  0.3404945 0.3750533 0.28445220
## 851  0.3404945 0.3750533 0.28445220
## 852  0.3404945 0.3750533 0.28445220
## 853  0.3404945 0.3750533 0.28445220
## 854  0.3404945 0.3750533 0.28445220
## 855  0.3404945 0.3750533 0.28445220
## 856  0.3404945 0.3750533 0.28445220
## 857  0.3404945 0.3750533 0.28445220
## 858  0.3404945 0.3750533 0.28445220
## 859  0.3404945 0.3750533 0.28445220
## 860  0.3404945 0.3750533 0.28445220
## 861  0.3404945 0.3750533 0.28445220
## 862  0.3404945 0.3750533 0.28445220
## 863  0.3404945 0.3750533 0.28445220
## 864  0.3404945 0.3750533 0.28445220
## 865  0.3404945 0.3750533 0.28445220
## 866  0.3404945 0.3750533 0.28445220
## 867  0.3404945 0.3750533 0.28445220
## 868  0.3404945 0.3750533 0.28445220
## 869  0.3404945 0.3750533 0.28445220
## 870  0.3404945 0.3750533 0.28445220
## 871  0.3404945 0.3750533 0.28445220
## 872  0.3404945 0.3750533 0.28445220
## 873  0.3404945 0.3750533 0.28445220
## 874  0.3404945 0.3750533 0.28445220
## 875  0.3404945 0.3750533 0.28445220
## 876  0.3404945 0.3750533 0.28445220
## 877  0.3404945 0.3750533 0.28445220
## 878  0.3404945 0.3750533 0.28445220
## 879  0.3404945 0.3750533 0.28445220
## 880  0.3404945 0.3750533 0.28445220
## 881  0.3404945 0.3750533 0.28445220
## 882  0.3404945 0.3750533 0.28445220
## 883  0.3404945 0.3750533 0.28445220
## 884  0.3404945 0.3750533 0.28445220
## 885  0.3404945 0.3750533 0.28445220
## 886  0.3404945 0.3750533 0.28445220
## 887  0.3404945 0.3750533 0.28445220
## 888  0.3404945 0.3750533 0.28445220
## 889  0.3404945 0.3750533 0.28445220
## 890  0.3404945 0.3750533 0.28445220
## 891  0.3404945 0.3750533 0.28445220
## 892  0.3404945 0.3750533 0.28445220
## 893  0.3404945 0.3750533 0.28445220
## 894  0.3404945 0.3750533 0.28445220
## 895  0.3404945 0.3750533 0.28445220
## 896  0.3404945 0.3750533 0.28445220
## 897  0.3404945 0.3750533 0.28445220
## 898  0.3404945 0.3750533 0.28445220
## 899  0.3404945 0.3750533 0.28445220
## 900  0.3404945 0.3750533 0.28445220
## 901  0.3404945 0.3750533 0.28445220
## 902  0.3404945 0.3750533 0.28445220
## 903  0.3404945 0.3750533 0.28445220
## 904  0.3404945 0.3750533 0.28445220
## 905  0.3404945 0.3750533 0.28445220
## 906  0.3404945 0.3750533 0.28445220
## 907  0.3404945 0.3750533 0.28445220
## 908  0.3404945 0.3750533 0.28445220
## 909  0.3404945 0.3750533 0.28445220
## 910  0.3404945 0.3750533 0.28445220
## 911  0.3404945 0.3750533 0.28445220
## 912  0.3404945 0.3750533 0.28445220
## 913  0.3404945 0.3750533 0.28445220
## 914  0.3404945 0.3750533 0.28445220
## 915  0.3404945 0.3750533 0.28445220
## 916  0.3404945 0.3750533 0.28445220
## 917  0.3404945 0.3750533 0.28445220
## 918  0.3404945 0.3750533 0.28445220
## 919  0.3404945 0.3750533 0.28445220
## 920  0.3404945 0.3750533 0.28445220
## 921  0.3404945 0.3750533 0.28445220
## 922  0.3404945 0.3750533 0.28445220
## 923  0.3404945 0.3750533 0.28445220
## 924  0.3404945 0.3750533 0.28445220
## 925  0.3404945 0.3750533 0.28445220
## 926  0.3404945 0.3750533 0.28445220
## 927  0.3404945 0.3750533 0.28445220
## 928  0.3404945 0.3750533 0.28445220
## 929  0.3404945 0.3750533 0.28445220
## 930  0.3404945 0.3750533 0.28445220
## 931  0.3404945 0.3750533 0.28445220
## 932  0.3404945 0.3750533 0.28445220
## 933  0.3404945 0.3750533 0.28445220
## 934  0.3404945 0.3750533 0.28445220
## 935  0.3404945 0.3750533 0.28445220
## 936  0.3404945 0.3750533 0.28445220
## 937  0.3404945 0.3750533 0.28445220
## 938  0.3404945 0.3750533 0.28445220
## 939  0.3404945 0.3750533 0.28445220
## 940  0.3404945 0.3750533 0.28445220
## 941  0.3404945 0.3750533 0.28445220
## 942  0.3404945 0.3750533 0.28445220
## 943  0.3404945 0.3750533 0.28445220
## 944  0.3404945 0.3750533 0.28445220
## 945  0.3404945 0.3750533 0.28445220
## 946  0.3404945 0.3750533 0.28445220
## 947  0.3404945 0.3750533 0.28445220
## 948  0.3404945 0.3750533 0.28445220
## 949  0.3404945 0.3750533 0.28445220
## 950  0.3404945 0.3750533 0.28445220
## 951  0.3404945 0.3750533 0.28445220
## 952  0.3404945 0.3750533 0.28445220
## 953  0.3404945 0.3750533 0.28445220
## 954  0.3404945 0.3750533 0.28445220
## 955  0.3404945 0.3750533 0.28445220
## 956  0.3404945 0.3750533 0.28445220
## 957  0.3404945 0.3750533 0.28445220
## 958  0.3404945 0.3750533 0.28445220
## 959  0.3404945 0.3750533 0.28445220
## 960  0.3404945 0.3750533 0.28445220
## 961  0.2049648 0.3479473 0.44708788
## 962  0.2049648 0.3479473 0.44708788
## 963  0.2049648 0.3479473 0.44708788
## 964  0.2049648 0.3479473 0.44708788
## 965  0.2049648 0.3479473 0.44708788
## 966  0.2049648 0.3479473 0.44708788
## 967  0.2049648 0.3479473 0.44708788
## 968  0.2049648 0.3479473 0.44708788
## 969  0.2049648 0.3479473 0.44708788
## 970  0.2049648 0.3479473 0.44708788
## 971  0.2049648 0.3479473 0.44708788
## 972  0.2049648 0.3479473 0.44708788
## 973  0.2049648 0.3479473 0.44708788
## 974  0.2049648 0.3479473 0.44708788
## 975  0.2049648 0.3479473 0.44708788
## 976  0.2049648 0.3479473 0.44708788
## 977  0.2049648 0.3479473 0.44708788
## 978  0.2049648 0.3479473 0.44708788
## 979  0.2049648 0.3479473 0.44708788
## 980  0.2049648 0.3479473 0.44708788
## 981  0.2049648 0.3479473 0.44708788
## 982  0.2049648 0.3479473 0.44708788
## 983  0.2049648 0.3479473 0.44708788
## 984  0.2049648 0.3479473 0.44708788
## 985  0.2049648 0.3479473 0.44708788
## 986  0.2049648 0.3479473 0.44708788
## 987  0.2049648 0.3479473 0.44708788
## 988  0.2049648 0.3479473 0.44708788
## 989  0.2049648 0.3479473 0.44708788
## 990  0.2049648 0.3479473 0.44708788
## 991  0.2049648 0.3479473 0.44708788
## 992  0.2049648 0.3479473 0.44708788
## 993  0.2049648 0.3479473 0.44708788
## 994  0.2049648 0.3479473 0.44708788
## 995  0.2049648 0.3479473 0.44708788
## 996  0.2049648 0.3479473 0.44708788
## 997  0.2049648 0.3479473 0.44708788
## 998  0.2049648 0.3479473 0.44708788
## 999  0.2049648 0.3479473 0.44708788
## 1000 0.2049648 0.3479473 0.44708788
## 1001 0.2049648 0.3479473 0.44708788
## 1002 0.2049648 0.3479473 0.44708788
## 1003 0.2049648 0.3479473 0.44708788
## 1004 0.2049648 0.3479473 0.44708788
## 1005 0.2049648 0.3479473 0.44708788
## 1006 0.2049648 0.3479473 0.44708788
## 1007 0.2049648 0.3479473 0.44708788
## 1008 0.2049648 0.3479473 0.44708788
## 1009 0.2049648 0.3479473 0.44708788
## 1010 0.2049648 0.3479473 0.44708788
## 1011 0.2049648 0.3479473 0.44708788
## 1012 0.2049648 0.3479473 0.44708788
## 1013 0.2049648 0.3479473 0.44708788
## 1014 0.2049648 0.3479473 0.44708788
## 1015 0.2049648 0.3479473 0.44708788
## 1016 0.2049648 0.3479473 0.44708788
## 1017 0.2049648 0.3479473 0.44708788
## 1018 0.2049648 0.3479473 0.44708788
## 1019 0.2049648 0.3479473 0.44708788
## 1020 0.2049648 0.3479473 0.44708788
## 1021 0.2049648 0.3479473 0.44708788
## 1022 0.2049648 0.3479473 0.44708788
## 1023 0.2049648 0.3479473 0.44708788
## 1024 0.2049648 0.3479473 0.44708788
## 1025 0.2049648 0.3479473 0.44708788
## 1026 0.2049648 0.3479473 0.44708788
## 1027 0.2049648 0.3479473 0.44708788
## 1028 0.2049648 0.3479473 0.44708788
## 1029 0.2049648 0.3479473 0.44708788
## 1030 0.2049648 0.3479473 0.44708788
## 1031 0.2049648 0.3479473 0.44708788
## 1032 0.2049648 0.3479473 0.44708788
## 1033 0.2049648 0.3479473 0.44708788
## 1034 0.2049648 0.3479473 0.44708788
## 1035 0.2049648 0.3479473 0.44708788
## 1036 0.2049648 0.3479473 0.44708788
## 1037 0.2049648 0.3479473 0.44708788
## 1038 0.2049648 0.3479473 0.44708788
## 1039 0.2049648 0.3479473 0.44708788
## 1040 0.2049648 0.3479473 0.44708788
## 1041 0.2049648 0.3479473 0.44708788
## 1042 0.2049648 0.3479473 0.44708788
## 1043 0.2049648 0.3479473 0.44708788
## 1044 0.2049648 0.3479473 0.44708788
## 1045 0.2049648 0.3479473 0.44708788
## 1046 0.2049648 0.3479473 0.44708788
## 1047 0.2049648 0.3479473 0.44708788
## 1048 0.2049648 0.3479473 0.44708788
## 1049 0.2049648 0.3479473 0.44708788
## 1050 0.2049648 0.3479473 0.44708788
## 1051 0.2049648 0.3479473 0.44708788
## 1052 0.2049648 0.3479473 0.44708788
## 1053 0.2049648 0.3479473 0.44708788
## 1054 0.2049648 0.3479473 0.44708788
## 1055 0.2049648 0.3479473 0.44708788
## 1056 0.2049648 0.3479473 0.44708788
## 1057 0.2049648 0.3479473 0.44708788
## 1058 0.2049648 0.3479473 0.44708788
## 1059 0.2049648 0.3479473 0.44708788
## 1060 0.2049648 0.3479473 0.44708788
## 1061 0.2049648 0.3479473 0.44708788
## 1062 0.2049648 0.3479473 0.44708788
## 1063 0.2049648 0.3479473 0.44708788
## 1064 0.2049648 0.3479473 0.44708788
## 1065 0.2049648 0.3479473 0.44708788
## 1066 0.2049648 0.3479473 0.44708788
## 1067 0.2049648 0.3479473 0.44708788
## 1068 0.2049648 0.3479473 0.44708788
## 1069 0.2049648 0.3479473 0.44708788
## 1070 0.2049648 0.3479473 0.44708788
## 1071 0.2049648 0.3479473 0.44708788
## 1072 0.2049648 0.3479473 0.44708788
## 1073 0.2049648 0.3479473 0.44708788
## 1074 0.2049648 0.3479473 0.44708788
## 1075 0.2049648 0.3479473 0.44708788
## 1076 0.2049648 0.3479473 0.44708788
## 1077 0.2049648 0.3479473 0.44708788
## 1078 0.2049648 0.3479473 0.44708788
## 1079 0.2049648 0.3479473 0.44708788
## 1080 0.2049648 0.3479473 0.44708788
## 1081 0.2049648 0.3479473 0.44708788
## 1082 0.2049648 0.3479473 0.44708788
## 1083 0.2049648 0.3479473 0.44708788
## 1084 0.2049648 0.3479473 0.44708788
## 1085 0.2049648 0.3479473 0.44708788
## 1086 0.2049648 0.3479473 0.44708788
## 1087 0.2049648 0.3479473 0.44708788
## 1088 0.2049648 0.3479473 0.44708788
## 1089 0.2049648 0.3479473 0.44708788
## 1090 0.2049648 0.3479473 0.44708788
## 1091 0.2049648 0.3479473 0.44708788
## 1092 0.2049648 0.3479473 0.44708788
## 1093 0.2049648 0.3479473 0.44708788
## 1094 0.2049648 0.3479473 0.44708788
## 1095 0.2049648 0.3479473 0.44708788
## 1096 0.2049648 0.3479473 0.44708788
## 1097 0.2049648 0.3479473 0.44708788
## 1098 0.2049648 0.3479473 0.44708788
## 1099 0.2049648 0.3479473 0.44708788
## 1100 0.2049648 0.3479473 0.44708788
## 1101 0.2049648 0.3479473 0.44708788
## 1102 0.2049648 0.3479473 0.44708788
## 1103 0.2049648 0.3479473 0.44708788
## 1104 0.2049648 0.3479473 0.44708788
## 1105 0.2049648 0.3479473 0.44708788
## 1106 0.2049648 0.3479473 0.44708788
## 1107 0.2049648 0.3479473 0.44708788
## 1108 0.2049648 0.3479473 0.44708788
## 1109 0.2049648 0.3479473 0.44708788
## 1110 0.2049648 0.3479473 0.44708788
## 1111 0.2049648 0.3479473 0.44708788
## 1112 0.2049648 0.3479473 0.44708788
## 1113 0.2049648 0.3479473 0.44708788
## 1114 0.2049648 0.3479473 0.44708788
## 1115 0.2049648 0.3479473 0.44708788
## 1116 0.2049648 0.3479473 0.44708788
## 1117 0.2049648 0.3479473 0.44708788
## 1118 0.2049648 0.3479473 0.44708788
## 1119 0.2049648 0.3479473 0.44708788
## 1120 0.2049648 0.3479473 0.44708788
## 1121 0.2049648 0.3479473 0.44708788
## 1122 0.2049648 0.3479473 0.44708788
## 1123 0.2049648 0.3479473 0.44708788
## 1124 0.2049648 0.3479473 0.44708788
## 1125 0.2049648 0.3479473 0.44708788
## 1126 0.2049648 0.3479473 0.44708788
## 1127 0.2049648 0.3479473 0.44708788
## 1128 0.2049648 0.3479473 0.44708788
## 1129 0.2049648 0.3479473 0.44708788
## 1130 0.2049648 0.3479473 0.44708788
## 1131 0.2049648 0.3479473 0.44708788
## 1132 0.2049648 0.3479473 0.44708788
## 1133 0.2049648 0.3479473 0.44708788
## 1134 0.2049648 0.3479473 0.44708788
## 1135 0.2049648 0.3479473 0.44708788
## 1136 0.2049648 0.3479473 0.44708788
## 1137 0.2049648 0.3479473 0.44708788
## 1138 0.2049648 0.3479473 0.44708788
## 1139 0.2049648 0.3479473 0.44708788
## 1140 0.2049648 0.3479473 0.44708788
## 1141 0.2049648 0.3479473 0.44708788
## 1142 0.2049648 0.3479473 0.44708788
## 1143 0.2049648 0.3479473 0.44708788
## 1144 0.2049648 0.3479473 0.44708788
## 1145 0.2049648 0.3479473 0.44708788
## 1146 0.2049648 0.3479473 0.44708788
## 1147 0.2049648 0.3479473 0.44708788
## 1148 0.2049648 0.3479473 0.44708788
## 1149 0.2049648 0.3479473 0.44708788
## 1150 0.2049648 0.3479473 0.44708788
## 1151 0.2049648 0.3479473 0.44708788
## 1152 0.2049648 0.3479473 0.44708788
## 1153 0.2049648 0.3479473 0.44708788
## 1154 0.2049648 0.3479473 0.44708788
## 1155 0.2049648 0.3479473 0.44708788
## 1156 0.2049648 0.3479473 0.44708788
## 1157 0.2049648 0.3479473 0.44708788
## 1158 0.2049648 0.3479473 0.44708788
## 1159 0.2049648 0.3479473 0.44708788
## 1160 0.2049648 0.3479473 0.44708788
## 1161 0.2049648 0.3479473 0.44708788
## 1162 0.2049648 0.3479473 0.44708788
## 1163 0.2049648 0.3479473 0.44708788
## 1164 0.2049648 0.3479473 0.44708788
## 1165 0.2049648 0.3479473 0.44708788
## 1166 0.2049648 0.3479473 0.44708788
## 1167 0.2049648 0.3479473 0.44708788
## 1168 0.2049648 0.3479473 0.44708788
## 1169 0.2049648 0.3479473 0.44708788
## 1170 0.2049648 0.3479473 0.44708788
## 1171 0.2049648 0.3479473 0.44708788
## 1172 0.2049648 0.3479473 0.44708788
## 1173 0.2049648 0.3479473 0.44708788
## 1174 0.2049648 0.3479473 0.44708788
## 1175 0.2049648 0.3479473 0.44708788
## 1176 0.2049648 0.3479473 0.44708788
## 1177 0.2049648 0.3479473 0.44708788
## 1178 0.2049648 0.3479473 0.44708788
## 1179 0.2049648 0.3479473 0.44708788
## 1180 0.2049648 0.3479473 0.44708788
## 1181 0.2049648 0.3479473 0.44708788
## 1182 0.2049648 0.3479473 0.44708788
## 1183 0.2049648 0.3479473 0.44708788
## 1184 0.2049648 0.3479473 0.44708788
## 1185 0.2049648 0.3479473 0.44708788
## 1186 0.2049648 0.3479473 0.44708788
## 1187 0.2049648 0.3479473 0.44708788
## 1188 0.2049648 0.3479473 0.44708788
## 1189 0.2049648 0.3479473 0.44708788
## 1190 0.2049648 0.3479473 0.44708788
## 1191 0.2049648 0.3479473 0.44708788
## 1192 0.2049648 0.3479473 0.44708788
## 1193 0.2049648 0.3479473 0.44708788
## 1194 0.2049648 0.3479473 0.44708788
## 1195 0.2049648 0.3479473 0.44708788
## 1196 0.2049648 0.3479473 0.44708788
## 1197 0.2049648 0.3479473 0.44708788
## 1198 0.2049648 0.3479473 0.44708788
## 1199 0.2049648 0.3479473 0.44708788
## 1200 0.2049648 0.3479473 0.44708788
## 1201 0.1073913 0.2809667 0.61164200
## 1202 0.1073913 0.2809667 0.61164200
## 1203 0.1073913 0.2809667 0.61164200
## 1204 0.1073913 0.2809667 0.61164200
## 1205 0.1073913 0.2809667 0.61164200
## 1206 0.1073913 0.2809667 0.61164200
## 1207 0.1073913 0.2809667 0.61164200
## 1208 0.1073913 0.2809667 0.61164200
## 1209 0.1073913 0.2809667 0.61164200
## 1210 0.1073913 0.2809667 0.61164200
## 1211 0.1073913 0.2809667 0.61164200
## 1212 0.1073913 0.2809667 0.61164200
## 1213 0.1073913 0.2809667 0.61164200
## 1214 0.1073913 0.2809667 0.61164200
## 1215 0.1073913 0.2809667 0.61164200
## 1216 0.1073913 0.2809667 0.61164200
## 1217 0.1073913 0.2809667 0.61164200
## 1218 0.1073913 0.2809667 0.61164200
## 1219 0.1073913 0.2809667 0.61164200
## 1220 0.1073913 0.2809667 0.61164200
## 1221 0.1073913 0.2809667 0.61164200
## 1222 0.1073913 0.2809667 0.61164200
## 1223 0.1073913 0.2809667 0.61164200
## 1224 0.1073913 0.2809667 0.61164200
## 1225 0.1073913 0.2809667 0.61164200
## 1226 0.1073913 0.2809667 0.61164200
## 1227 0.1073913 0.2809667 0.61164200
## 1228 0.1073913 0.2809667 0.61164200
## 1229 0.1073913 0.2809667 0.61164200
## 1230 0.1073913 0.2809667 0.61164200
## 1231 0.1073913 0.2809667 0.61164200
## 1232 0.1073913 0.2809667 0.61164200
## 1233 0.1073913 0.2809667 0.61164200
## 1234 0.1073913 0.2809667 0.61164200
## 1235 0.1073913 0.2809667 0.61164200
## 1236 0.1073913 0.2809667 0.61164200
## 1237 0.1073913 0.2809667 0.61164200
## 1238 0.1073913 0.2809667 0.61164200
## 1239 0.1073913 0.2809667 0.61164200
## 1240 0.1073913 0.2809667 0.61164200
## 1241 0.1073913 0.2809667 0.61164200
## 1242 0.1073913 0.2809667 0.61164200
## 1243 0.1073913 0.2809667 0.61164200
## 1244 0.1073913 0.2809667 0.61164200
## 1245 0.1073913 0.2809667 0.61164200
## 1246 0.1073913 0.2809667 0.61164200
## 1247 0.1073913 0.2809667 0.61164200
## 1248 0.1073913 0.2809667 0.61164200
## 1249 0.1073913 0.2809667 0.61164200
## 1250 0.1073913 0.2809667 0.61164200
## 1251 0.1073913 0.2809667 0.61164200
## 1252 0.1073913 0.2809667 0.61164200
## 1253 0.1073913 0.2809667 0.61164200
## 1254 0.1073913 0.2809667 0.61164200
## 1255 0.1073913 0.2809667 0.61164200
## 1256 0.1073913 0.2809667 0.61164200
## 1257 0.1073913 0.2809667 0.61164200
## 1258 0.1073913 0.2809667 0.61164200
## 1259 0.1073913 0.2809667 0.61164200
## 1260 0.1073913 0.2809667 0.61164200
## 1261 0.1073913 0.2809667 0.61164200
## 1262 0.1073913 0.2809667 0.61164200
## 1263 0.1073913 0.2809667 0.61164200
## 1264 0.1073913 0.2809667 0.61164200
## 1265 0.1073913 0.2809667 0.61164200
## 1266 0.1073913 0.2809667 0.61164200
## 1267 0.1073913 0.2809667 0.61164200
## 1268 0.1073913 0.2809667 0.61164200
## 1269 0.1073913 0.2809667 0.61164200
## 1270 0.1073913 0.2809667 0.61164200
## 1271 0.1073913 0.2809667 0.61164200
## 1272 0.1073913 0.2809667 0.61164200
## 1273 0.1073913 0.2809667 0.61164200
## 1274 0.1073913 0.2809667 0.61164200
## 1275 0.1073913 0.2809667 0.61164200
## 1276 0.1073913 0.2809667 0.61164200
## 1277 0.1073913 0.2809667 0.61164200
## 1278 0.1073913 0.2809667 0.61164200
## 1279 0.1073913 0.2809667 0.61164200
## 1280 0.1073913 0.2809667 0.61164200
## 1281 0.1073913 0.2809667 0.61164200
## 1282 0.1073913 0.2809667 0.61164200
## 1283 0.1073913 0.2809667 0.61164200
## 1284 0.1073913 0.2809667 0.61164200
## 1285 0.1073913 0.2809667 0.61164200
## 1286 0.1073913 0.2809667 0.61164200
## 1287 0.1073913 0.2809667 0.61164200
## 1288 0.1073913 0.2809667 0.61164200
## 1289 0.1073913 0.2809667 0.61164200
## 1290 0.1073913 0.2809667 0.61164200
## 1291 0.1073913 0.2809667 0.61164200
## 1292 0.1073913 0.2809667 0.61164200
## 1293 0.1073913 0.2809667 0.61164200
## 1294 0.1073913 0.2809667 0.61164200
## 1295 0.1073913 0.2809667 0.61164200
## 1296 0.1073913 0.2809667 0.61164200
## 1297 0.1073913 0.2809667 0.61164200
## 1298 0.1073913 0.2809667 0.61164200
## 1299 0.1073913 0.2809667 0.61164200
## 1300 0.1073913 0.2809667 0.61164200
## 1301 0.1073913 0.2809667 0.61164200
## 1302 0.1073913 0.2809667 0.61164200
## 1303 0.1073913 0.2809667 0.61164200
## 1304 0.1073913 0.2809667 0.61164200
## 1305 0.1073913 0.2809667 0.61164200
## 1306 0.1073913 0.2809667 0.61164200
## 1307 0.1073913 0.2809667 0.61164200
## 1308 0.1073913 0.2809667 0.61164200
## 1309 0.1073913 0.2809667 0.61164200
## 1310 0.1073913 0.2809667 0.61164200
## 1311 0.1073913 0.2809667 0.61164200
## 1312 0.1073913 0.2809667 0.61164200
## 1313 0.1073913 0.2809667 0.61164200
## 1314 0.1073913 0.2809667 0.61164200
## 1315 0.1073913 0.2809667 0.61164200
## 1316 0.1073913 0.2809667 0.61164200
## 1317 0.1073913 0.2809667 0.61164200
## 1318 0.1073913 0.2809667 0.61164200
## 1319 0.1073913 0.2809667 0.61164200
## 1320 0.1073913 0.2809667 0.61164200
## 1321 0.1073913 0.2809667 0.61164200
## 1322 0.1073913 0.2809667 0.61164200
## 1323 0.1073913 0.2809667 0.61164200
## 1324 0.1073913 0.2809667 0.61164200
## 1325 0.1073913 0.2809667 0.61164200
## 1326 0.1073913 0.2809667 0.61164200
## 1327 0.1073913 0.2809667 0.61164200
## 1328 0.1073913 0.2809667 0.61164200
## 1329 0.1073913 0.2809667 0.61164200
## 1330 0.1073913 0.2809667 0.61164200
## 1331 0.1073913 0.2809667 0.61164200
## 1332 0.1073913 0.2809667 0.61164200
## 1333 0.1073913 0.2809667 0.61164200
## 1334 0.1073913 0.2809667 0.61164200
## 1335 0.1073913 0.2809667 0.61164200
## 1336 0.1073913 0.2809667 0.61164200
## 1337 0.1073913 0.2809667 0.61164200
## 1338 0.1073913 0.2809667 0.61164200
## 1339 0.1073913 0.2809667 0.61164200
## 1340 0.1073913 0.2809667 0.61164200
## 1341 0.1073913 0.2809667 0.61164200
## 1342 0.1073913 0.2809667 0.61164200
## 1343 0.1073913 0.2809667 0.61164200
## 1344 0.1073913 0.2809667 0.61164200
## 1345 0.1073913 0.2809667 0.61164200
## 1346 0.1073913 0.2809667 0.61164200
## 1347 0.1073913 0.2809667 0.61164200
## 1348 0.1073913 0.2809667 0.61164200
## 1349 0.1073913 0.2809667 0.61164200
## 1350 0.1073913 0.2809667 0.61164200
## 1351 0.1073913 0.2809667 0.61164200
## 1352 0.1073913 0.2809667 0.61164200
## 1353 0.1073913 0.2809667 0.61164200
## 1354 0.1073913 0.2809667 0.61164200
## 1355 0.1073913 0.2809667 0.61164200
## 1356 0.1073913 0.2809667 0.61164200
## 1357 0.1073913 0.2809667 0.61164200
## 1358 0.1073913 0.2809667 0.61164200
## 1359 0.1073913 0.2809667 0.61164200
## 1360 0.1073913 0.2809667 0.61164200
## 1361 0.1073913 0.2809667 0.61164200
## 1362 0.1073913 0.2809667 0.61164200
## 1363 0.1073913 0.2809667 0.61164200
## 1364 0.1073913 0.2809667 0.61164200
## 1365 0.1073913 0.2809667 0.61164200
## 1366 0.1073913 0.2809667 0.61164200
## 1367 0.1073913 0.2809667 0.61164200
## 1368 0.1073913 0.2809667 0.61164200
## 1369 0.1073913 0.2809667 0.61164200
## 1370 0.1073913 0.2809667 0.61164200
## 1371 0.1073913 0.2809667 0.61164200
## 1372 0.1073913 0.2809667 0.61164200
## 1373 0.1073913 0.2809667 0.61164200
## 1374 0.1073913 0.2809667 0.61164200
## 1375 0.1073913 0.2809667 0.61164200
## 1376 0.1073913 0.2809667 0.61164200
## 1377 0.1073913 0.2809667 0.61164200
## 1378 0.1073913 0.2809667 0.61164200
## 1379 0.1073913 0.2809667 0.61164200
## 1380 0.1073913 0.2809667 0.61164200
## 1381 0.1073913 0.2809667 0.61164200
## 1382 0.1073913 0.2809667 0.61164200
## 1383 0.1073913 0.2809667 0.61164200
## 1384 0.1073913 0.2809667 0.61164200
## 1385 0.1073913 0.2809667 0.61164200
## 1386 0.1073913 0.2809667 0.61164200
## 1387 0.1073913 0.2809667 0.61164200
## 1388 0.1073913 0.2809667 0.61164200
## 1389 0.1073913 0.2809667 0.61164200
## 1390 0.1073913 0.2809667 0.61164200
## 1391 0.1073913 0.2809667 0.61164200
## 1392 0.1073913 0.2809667 0.61164200
## 1393 0.1073913 0.2809667 0.61164200
## 1394 0.1073913 0.2809667 0.61164200
## 1395 0.1073913 0.2809667 0.61164200
## 1396 0.1073913 0.2809667 0.61164200
## 1397 0.1073913 0.2809667 0.61164200
## 1398 0.1073913 0.2809667 0.61164200
## 1399 0.1073913 0.2809667 0.61164200
## 1400 0.1073913 0.2809667 0.61164200
## 1401 0.1073913 0.2809667 0.61164200
## 1402 0.1073913 0.2809667 0.61164200
## 1403 0.1073913 0.2809667 0.61164200
## 1404 0.1073913 0.2809667 0.61164200
## 1405 0.1073913 0.2809667 0.61164200
## 1406 0.1073913 0.2809667 0.61164200
## 1407 0.1073913 0.2809667 0.61164200
## 1408 0.1073913 0.2809667 0.61164200
## 1409 0.1073913 0.2809667 0.61164200
## 1410 0.1073913 0.2809667 0.61164200
## 1411 0.1073913 0.2809667 0.61164200
## 1412 0.1073913 0.2809667 0.61164200
## 1413 0.1073913 0.2809667 0.61164200
## 1414 0.1073913 0.2809667 0.61164200
## 1415 0.1073913 0.2809667 0.61164200
## 1416 0.1073913 0.2809667 0.61164200
## 1417 0.1073913 0.2809667 0.61164200
## 1418 0.1073913 0.2809667 0.61164200
## 1419 0.1073913 0.2809667 0.61164200
## 1420 0.1073913 0.2809667 0.61164200
## 1421 0.1073913 0.2809667 0.61164200
## 1422 0.1073913 0.2809667 0.61164200
## 1423 0.1073913 0.2809667 0.61164200
## 1424 0.1073913 0.2809667 0.61164200
## 1425 0.1073913 0.2809667 0.61164200
## 1426 0.1073913 0.2809667 0.61164200
## 1427 0.1073913 0.2809667 0.61164200
## 1428 0.1073913 0.2809667 0.61164200
## 1429 0.1073913 0.2809667 0.61164200
## 1430 0.1073913 0.2809667 0.61164200
## 1431 0.1073913 0.2809667 0.61164200
## 1432 0.1073913 0.2809667 0.61164200
## 1433 0.1073913 0.2809667 0.61164200
## 1434 0.1073913 0.2809667 0.61164200
## 1435 0.1073913 0.2809667 0.61164200
## 1436 0.1073913 0.2809667 0.61164200
## 1437 0.1073913 0.2809667 0.61164200
## 1438 0.1073913 0.2809667 0.61164200
## 1439 0.1073913 0.2809667 0.61164200
## 1440 0.1073913 0.2809667 0.61164200

Purchase intent: Chi-square

## Combine two columns
Decision$Condition <- paste(Decision$Ferm.Type, Decision$Millet.Ratio)

Decision.chi <- Decision %>%
  dplyr::select(Condition, Buy) %>%
  group_by(Condition, Buy) %>%
  summarize(n = n()) %>%
  pivot_wider(names_from = Buy, values_from = n, values_fill = 0) %>%
  column_to_rownames(var = "Condition") %>%
  rename("Buy" = "1", "Maybe" = "2", "Not Buy" = "3")
## `summarise()` has grouped output by 'Condition'. You can override using the `.groups` argument.
chisq.test(Decision.chi)
## 
##  Pearson's Chi-squared test
## 
## data:  Decision.chi
## X-squared = 506.01, df = 22, p-value < 2.2e-16

Purchase intent: Bar graph

## Buy or not buy bar chart
Decision$Ferm.Type <- factor(Decision$Ferm.Type, levels = c("Unfermented", "Fermented"))

Decision%>% 
  mutate(Buy = case_when(Buy == "1" ~ "Buy",
                         Buy == "2" ~ "Maybe",
                         Buy == "3" ~ "Not Buy")) %>%
  ggplot(aes(x = as.factor(Millet.Ratio), fill = Buy)) +
  geom_bar(position="fill") +
  facet_wrap(~Ferm.Type) +
  scale_fill_manual(values = c("#2E7D32", "#FF9800", "#B71C1C"))+
  theme_bw() +
  theme(strip.background = element_rect(fill="white"))