#Valores a revisar

dfLong %>% filter(value>10)
## # A tibble: 0 x 4
## # ... with 4 variables: Codigo <chr>, Variable <int>, Tiempo <chr>, value <dbl>

Si no ha salido nada antes, es que ahora no están esos fallos.

#dfLong=dfLong %>% filter (value<=10)
dfLong %>% count(Tiempo,Variable,value) %>%ggplot(aes(x=value,y=n,fill=Tiempo))+
  geom_col(position="dodge")+
  facet_wrap(~Variable,ncol = 5)
## Warning: Removed 89 rows containing missing values (geom_col).

dfPar=dfLong %>% filter(Tiempo=="1") %>% select(-Tiempo) %>% rename(pre=value) %>% inner_join(dfLong %>% filter(Tiempo=="2") %>% select(-Tiempo)%>%rename(post=value)) %>% mutate(dif=post-pre,media=((post+pre)/2))
## Joining, by = c("Codigo", "Variable")
dfPar %>% ggplot(aes(x=pre,y=post,colour=Variable)) +
  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 2465 rows containing non-finite values (stat_smooth).
## Warning: Removed 2465 rows containing missing values (geom_point).

dfPar %>% ggplot(aes(x=pre,y=post)) +
  geom_jitter(alpha=0.5)+
  geom_smooth(method="lm",se=F)+
  geom_abline(intercept = 0,slope = 1)+
  facet_wrap(~ Variable,ncol = 5)
## `geom_smooth()` using formula 'y ~ x'
## Warning: Removed 2465 rows containing non-finite values (stat_smooth).
## Warning: Removed 2465 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.5)+
  geom_smooth(method="lm",se = F)+
  geom_hline(yintercept=0)+
  facet_wrap(~ Variable,ncol = 5)+
  ggtitle("Bland Altman")
## `geom_smooth()` using formula 'y ~ x'
## Warning: Removed 2465 rows containing non-finite values (stat_smooth).
## Warning: Removed 2465 rows containing missing values (geom_point).

Vamos a centrarnos sobre todo en la zona de cambios de dos puntos arriba o abajo de dif=0. La línea de color nos da más detalle de como es dif con respecto a cero (linea negra)

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