June 24, 2019

Introduction

  • The Riemann Hypothesis, one of the Clay Millenium million dollar prize problems, has had some recent progress via Jensen Polynomials.
  • It is worth seeing the Riemann Zeta function along the critical line where the real part of the argument is 0.5..
  • Code adapted from pracma examples, implemented there with plot, here with plot.ly.
  • Where the real part, imaginary part, and absolute value of zeta(z) are 0 is one of the zeroes of the zeta function
  • Graph shows the zeta function applied to complex z, where the imaginary part of the z is on the horizontal axis, and where the real part of z is 0.5. This is where the Riemann Hypothesis suggests all the 0s lie.

Underlying Code

# http://rpubs.com/dlarue/zeta
library(plotly)
library(pracma)
x <- seq(0, 20, len=1001)
z <- 0.5 + x*1i
fr <- Re(zeta(z))
fi <- Im(zeta(z))
fa <- abs(zeta(z))
p<-plot_ly()
p<-add_lines(p,x=x,y=fr,name="Re(zeta)")
p<-add_lines(p,x=x,y=fi,name="Im(zeta)")
p<-add_lines(p,x=x,y=fa,name="Abs(zeta)")
p<-layout(p,title=
            paste("Value of Zeta(z) vs imaginary",
                  " part of z with real part 0.5"))

plot.ly plot