4 statistical tests Pion B64
<-1000
N<- data.frame(
df"x"= runif(N),
"err"=rep(0,N),
"np"=rep(0,N)
)
for(i in c(1:N)){
$np[i]<-N-i+1
df$err[i] <- sd(df$x[c(i:N)])/sqrt(df$np[i])
df
}<-ggplot(df)+geom_point(aes(x=1/sqrt(np), y=err))+theme_bw()
gg<-myplotly(gg,"","1/sqrt(N)","err",to_print = TRUE) fig
<r >