Let’s solve the linear ODE u'=1.01u
. First setup the package:
<- diffeqr::diffeq_setup() de
Define the derivative function f(u,p,t)
.
<- function(u,p,t) {
f return(1.01*u)
}
Then we give it an initial condition and a time span to solve over:
<- 1/2
u0 <- c(0., 1.) tspan
With those pieces we define the ODEProblem
and solve
the ODE:
= de$ODEProblem(f, u0, tspan)
prob = de$solve(prob) sol
This gives back a solution object for which sol$t
are the time points and sol$u
are the values. We can treat the solution as a continuous object in time via
and a high order interpolation will compute the value at t=0.2
. We can check the solution by plotting it:
plot(sol$t,sol$u,"l")
Now let’s solve the Lorenz equations. In this case, our initial condition is a vector and our derivative functions takes in the vector to return a vector (note: arbitrary dimensional arrays are allowed). We would define this as:
<- function(u,p,t) {
f = p[1]*(u[2]-u[1])
du1 = u[1]*(p[2]-u[3]) - u[2]
du2 = u[1]*u[2] - p[3]*u[3]
du3 return(c(du1,du2,du3))
}
Here we utilized the parameter array p
. Thus we use diffeqr::ode.solve
like before, but also pass in parameters this time:
<- c(1.0,0.0,0.0)
u0 <- list(0.0,100.0)
tspan <- c(10.0,28.0,8/3)
p <- de$ODEProblem(f, u0, tspan, p)
prob <- de$solve(prob) sol
The returned solution is like before except now sol$u
is an array of arrays, where sol$u[i]
is the full system at time sol$t[i]
. It can be convenient to turn this into an R matrix through sapply
:
<- sapply(sol$u,identity) mat
This has each row as a time series. t(mat)
makes each column a time series. It is sometimes convenient to turn the output into a data.frame
which is done via:
<- as.data.frame(t(mat)) udf
Now we can use matplot
to plot the timeseries together:
matplot(sol$t,udf,"l",col=1:3)
Now we can use the Plotly package to draw a phase plot:
::plot_ly(udf, x = ~V1, y = ~V2, z = ~V3, type = 'scatter3d', mode = 'lines') plotly
Plotly is much prettier!
If we want to have a more accurate solution, we can send abstol
and reltol
. Defaults are 1e-6
and 1e-3
respectively. Generally you can think of the digits of accuracy as related to 1 plus the exponent of the relative tolerance, so the default is two digits of accuracy. Absolute tolernace is the accuracy near 0.
In addition, we may want to choose to save at more time points. We do this by giving an array of values to save at as saveat
. Together, this looks like:
<- 1e-8
abstol <- 1e-8
reltol <- 0:10000/100
saveat <- de$solve(prob,abstol=abstol,reltol=reltol,saveat=saveat)
sol <- as.data.frame(t(sapply(sol$u,identity)))
udf ::plot_ly(udf, x = ~V1, y = ~V2, z = ~V3, type = 'scatter3d', mode = 'lines') plotly
We can also choose to use a different algorithm. The choice is done using a string that matches the Julia syntax. See the ODE tutorial for details. The list of choices for ODEs can be found at the ODE Solvers page. For example, let’s use a 9th order method due to Verner:
<- de$solve(prob,de$Vern9(),abstol=abstol,reltol=reltol,saveat=saveat) sol
Note that each algorithm choice will cause a JIT compilation
One way to enhance the performance of your code is to define the function in Julia so that way it is JIT compiled. diffeqr is built using the JuliaCall package, and so you can utilize the Julia JIT compiler. We expose this automatically over ODE functions via jitoptimize_ode
, like in the following example:
<- function(u,p,t) {
f = p[1]*(u[2]-u[1])
du1 = u[1]*(p[2]-u[3]) - u[2]
du2 = u[1]*u[2] - p[3]*u[3]
du3 return(c(du1,du2,du3))
}<- c(1.0,0.0,0.0)
u0 <- c(0.0,100.0)
tspan <- c(10.0,28.0,8/3)
p <- de$ODEProblem(f, u0, tspan, p)
prob <- diffeqr::jitoptimize_ode(de,prob)
fastprob <- de$solve(fastprob,de$Tsit5()) sol
Note that the first evaluation of the function will have an ~2 second lag since the compiler will run, and all subsequent runs will be orders of magnitude faster than the pure R function. This means it’s great for expensive functions (ex. large PDEs) or functions called repeatedly, like during optimization of parameters.
We can also use the JuliaCall functions to directly define the function in Julia to eliminate the R interpreter overhead and get full JIT compilation:
<- JuliaCall::julia_eval("
julf function julf(du,u,p,t)
du[1] = 10.0*(u[2]-u[1])
du[2] = u[1]*(28.0-u[3]) - u[2]
du[3] = u[1]*u[2] - (8/3)*u[3]
end")
::julia_assign("u0", u0)
JuliaCall::julia_assign("p", p)
JuliaCall::julia_assign("tspan", tspan)
JuliaCall= JuliaCall::julia_eval("ODEProblem(julf, u0, tspan, p)")
prob3 = de$solve(prob3,de$Tsit5()) sol
To demonstrate the performance advantage, let’s time them all:
> system.time({ for (i in 1:100){ de$solve(prob ,de$Tsit5()) }})
user system elapsed6.69 0.06 6.78
> system.time({ for (i in 1:100){ de$solve(fastprob,de$Tsit5()) }})
user system elapsed0.11 0.03 0.14
> system.time({ for (i in 1:100){ de$solve(prob3 ,de$Tsit5()) }})
user system elapsed0.14 0.02 0.15
This is about a 50x improvement!