#dfLong=dfLong %>% filter (value<=10)
dfPuntosLong  %>%ggplot(aes(x=value,fill=Tiempo))+
  geom_histogram(position="identity", alpha=0.5)+
  facet_wrap(~name)
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.
## Warning: Removed 127 rows containing non-finite values (stat_bin).

dfPar=dfPuntosLong %>% filter(Tiempo=="1") %>% select(-Tiempo) %>% rename(pre=value) %>% inner_join(dfPuntosLong %>% filter(Tiempo=="2") %>% select(-Tiempo)%>%rename(post=value)) %>% mutate(dif=post-pre,media=((post+pre)/2))
## Joining, by = c("Codigo", "name")
dfPar %>% ggplot(aes(x=pre,y=post,colour=name)) +
  geom_jitter(alpha=0.5)+
  geom_smooth(method="lm",se = F)+
  geom_abline(intercept = 0,slope = 1)
## `geom_smooth()` using formula 'y ~ x'
## Warning: Removed 124 rows containing non-finite values (stat_smooth).
## Warning: Removed 124 rows containing missing values (geom_point).

dfPar %>% ggplot(aes(x=pre,y=post)) +
  geom_jitter(alpha=0.25)+
  geom_smooth(method="lm",se=F)+
  geom_abline(intercept = 0,slope = 1)+
  facet_wrap(~ name)
## `geom_smooth()` using formula 'y ~ x'
## Warning: Removed 124 rows containing non-finite values (stat_smooth).
## Warning: Removed 124 rows containing missing values (geom_point).

En los gráficos de Bland Altman, si alguien no cambia dif=0, donde dif=post-pre. Si los valores son mayores que cero, la persona a aumentado su puntuación.

dfPar %>% ggplot(aes(x=media,y=dif)) +
  geom_jitter(alpha=0.25)+
  geom_smooth(method="lm",se = F)+
  geom_hline(yintercept=0)+
  facet_wrap(~ name)+
  ggtitle("Bland Altman")
## `geom_smooth()` using formula 'y ~ x'
## Warning: Removed 124 rows containing non-finite values (stat_smooth).
## Warning: Removed 124 rows containing missing values (geom_point).