# This file is part of the Test Set for BVP solvers # # http://www.dm.uniba.it/~bvpsolvers/ # # Problem bvpT10_ho # SPBVP of order 2 # # DISCLAIMER: see # http://www.dm.uniba.it/~bvpsolvers/testsetbvpsolvers/?page_id=34 # # The most recent version of this source file can be found at # http://www.dm.uniba.it/~bvpsolvers/bvpTestSet/Rsrc/problems/bvpT10_ho.R # bvpT10_ho<- function(){ prob<- function(){ fullnm <- 'Problem bvpT10_ho' problm = 'bvpT10_ho' typebvp = 'SPBVP' neqn = 1 nlbc = 1 aleft = -1.0e0 aright = 1.0e0 numjac = FALSE numbcjac = FALSE linear = TRUE Rpar<-c(0.5) Ipar<-0 ms <- rep(2,neqn) return(list(fullnm=fullnm,problm=problm,typebvp=typebvp,neqn=neqn, nlbc=nlbc,ms=ms,aleft=aleft,aright=aright,Rpar=Rpar,Ipar=Ipar, numjac=numjac,numbcjac=numbcjac,linear=linear)) } library(pracma) init <- function(neqn,ms,aleft,aright) { givmsh = TRUE givey = TRUE nmsh = 11 xguess = seq(aleft,aright,by=(aright-aleft)/(nmsh-1)) yguess <- NULL for (i in 1:neqn) for (j in 1:ms[i]) yguess <- rbind(yguess,rep(0,nmsh)) return(list(givmsh=givmsh,givey=givey, nmsh=nmsh,xguess=xguess,yguess=yguess)) } feval = function(x,y,eps,Rpar,Ipar){ f <- c(-x*y[2]/eps ) return(list(f)) } jeval = function(x,y,eps,Rpar,Ipar){ dfy <- matrix( nrow=1,ncol=2,byrow = TRUE, data = c(0, -x/eps)) return((dfy)) } bceval <- function(i, y, eps,Rpar,Ipar) { if (i == 1) return(y[1]) if (i == 2) return(y[1]-2) } dbceval <- function(i, y, eps,Rpar,Ipar) { if (i == 1) return(c(1, 0)) if (i == 2) return(c(1, 0)) } setoutput<- function(neqn,plotsol=NULL){ solref = FALSE if (is.null(plotsol)){ nindsol = neqn indsol = 1;neqn } else{ nindsol = length(plotsol) indsol = plotsol } return(list(solref=solref,nindsol=nindsol,indsol=indsol)) } esolu <- function(X,parms,Rpar,Ipar){ lambda=parms Exact =matrix( c( 1.0e0+erf(X/sqrt(2.0e0*lambda))/erf(1.0e0/sqrt(2.0e0*lambda)), 2^(1/2)/(pi^(1/2)*lambda^(1/2)*exp(X^2/(2*lambda))*erf(2^(1/2)/(2*lambda^(1/2))))), ncol=2,nrow=length(X),byrow=FALSE) return(Exact=Exact) } return(list(prob=prob,init=init,feval=feval,jeval=jeval,bceval=bceval,dbceval=dbceval,setoutput=setoutput,esolu=esolu)) }