37 PUBLIC :: equationparser
42 INTEGER(is),
PARAMETER :: cimmed = 1, &
65 CHARACTER (LEN=1),
DIMENSION(cAdd:cPow),
PARAMETER :: ops = (/
'+', &
71 CHARACTER (LEN=5),
DIMENSION(cAbs:cAtan),
PARAMETER :: funcs = (/
'abs ', &
86 INTEGER,
parameter :: max_fun_length = 1024
90 INTEGER(is),
POINTER :: bytecode(:) => null()
91 INTEGER :: bytecodesize = 0
92 REAL(rn),
POINTER :: immed(:) => null()
93 INTEGER :: immedsize = 0
94 REAL(rn),
POINTER :: stack(:) => null()
95 INTEGER :: stacksize = 0
96 INTEGER :: stackptr = 0
98 character(len=MAX_FUN_LENGTH) :: funcstring =
''
99 character(len=MAX_FUN_LENGTH) :: funcstringorig =
''
100 character(len=MAX_FUN_LENGTH),
allocatable :: variablenames(:)
105 procedure,
public :: evaluate
108 procedure :: addcompiledbyte
109 procedure :: compilesubstr
110 procedure :: mathitemindex
111 procedure :: checksyntax
115 END TYPE equationparser
118 interface equationparser
119 procedure constructor
120 end interface equationparser
125 type (equationparser
) function constructor(funcstr, var)
127 CHARACTER (LEN=*),
INTENT(in) :: funcstr
128 CHARACTER (LEN=*),
DIMENSION(:),
INTENT(in) :: var
130 constructor%ByteCode => null()
131 constructor%Immed => null()
132 constructor%Stack => null()
134 constructor%ByteCodeSize = 0
135 constructor%ImmedSize = 0
136 constructor%StackSize = 0
137 constructor%StackPtr = 0
139 constructor%funcString = funcstr
140 constructor%funcStringOrig = funcstr
142 allocate(constructor%variableNames(
size(var)))
144 constructor%variableNames(:) = var(:)
146 call constructor%parse()
148 end function constructor
151 subroutine finalize(this)
153 type(equationparser
) :: this
155 if (
associated(this%ByteCode)) nullify(this%ByteCode)
156 if (
associated(this%Immed)) nullify(this%Immed)
157 if (
associated(this%Stack)) nullify(this%Stack)
159 end subroutine finalize
162 SUBROUTINE parse(this)
164 class(equationparser) :: this
166 CALL replace(
'**',
'^ ', this%funcString)
168 CALL removespaces(this%funcString)
170 CALL this%CheckSyntax()
177 FUNCTION evaluate(this, Val) RESULT (res)
179 class(equationparser) :: this
180 REAL(rn),
DIMENSION(:),
INTENT(in) :: val
186 REAL(rn),
PARAMETER ::
zero = 0._rn
187 integer :: evalerrtype
193 DO ip=1,this%ByteCodeSize
195 SELECT CASE (this%ByteCode(ip))
197 CASE (cimmed); sp=sp+1; this%Stack(sp)=this%Immed(dp); dp=dp+1
199 CASE (cneg); this%Stack(sp)=-this%Stack(sp)
201 CASE (cadd); this%Stack(sp-1)=this%Stack(sp-1)+this%Stack(sp); sp=sp-1
203 CASE (csub); this%Stack(sp-1)=this%Stack(sp-1)-this%Stack(sp); sp=sp-1
205 CASE (cmul); this%Stack(sp-1)=this%Stack(sp-1)*this%Stack(sp); sp=sp-1
209 IF (this%Stack(sp)==0._rn)
THEN
214 this%Stack(sp-1)=this%Stack(sp-1)/this%Stack(sp); sp=sp-1
216 CASE (cpow); this%Stack(sp-1)=this%Stack(sp-1)**this%Stack(sp); sp=sp-1
218 CASE (cabs); this%Stack(sp)=abs(this%Stack(sp))
220 CASE (cexp); this%Stack(sp)=exp(this%Stack(sp))
224 IF (this%Stack(sp)<=0._rn)
THEN
229 this%Stack(sp)=log10(this%Stack(sp))
233 IF (this%Stack(sp)<=0._rn)
THEN
238 this%Stack(sp)=log(this%Stack(sp))
242 IF (this%Stack(sp)<0._rn)
THEN
247 this%Stack(sp)=sqrt(this%Stack(sp))
249 CASE (csinh); this%Stack(sp)=sinh(this%Stack(sp))
251 CASE (ccosh); this%Stack(sp)=cosh(this%Stack(sp))
253 CASE (ctanh); this%Stack(sp)=tanh(this%Stack(sp))
255 CASE (csin); this%Stack(sp)=sin(this%Stack(sp))
257 CASE (ccos); this%Stack(sp)=cos(this%Stack(sp))
259 CASE (ctan); this%Stack(sp)=tan(this%Stack(sp))
263 IF ((this%Stack(sp)<-1._rn) .OR. (this%Stack(sp)>1._rn))
THEN
268 this%Stack(sp)=asin(this%Stack(sp))
271 IF ((this%Stack(sp)<-1._rn).OR.(this%Stack(sp)>1._rn))
THEN
276 this%Stack(sp)=acos(this%Stack(sp))
278 CASE (catan); this%Stack(sp)=atan(this%Stack(sp))
280 CASE default; sp=sp+1; this%Stack(sp)=val(this%ByteCode(ip)-varbegin+1)
286 IF (evalerrtype > 0)
then
287 WRITE(*,*)
'*** Error: ',evalerrmsg(evalerrtype)
292 END FUNCTION evaluate
295 SUBROUTINE checksyntax(this)
297 class(equationparser) :: this
299 CHARACTER (LEN=1) :: c
307 lfunc = len_trim(this%funcString)
309 IF (j > lfunc) CALL parseerrmsg(j, this%funcStringOrig)
310 c = this%funcString(j:j)
314 IF (c ==
'-' .OR. c ==
'+')
THEN
316 IF (j > lfunc) CALL parseerrmsg(j, this%funcStringOrig,
'Missing operand')
317 c = this%funcString(j:j)
318 IF (any(c == ops)) CALL parseerrmsg(j, this%funcStringOrig,
'Multiple operators')
320 n = mathfunctionindex(this%funcString(j:))
322 j = j+len_trim(funcs(n))
323 IF (j > lfunc) CALL parseerrmsg(j, this%funcStringOrig,
'Missing function argument')
324 c = this%funcString(j:j)
325 IF (c /=
'(') CALL parseerrmsg(j, this%funcStringOrig,
'Missing opening parenthesis')
332 IF (scan(c,
'0123456789.') > 0)
THEN
333 r = realnum(this%funcString(j:),ib,in,err)
334 IF (err) CALL parseerrmsg(j, this%funcStringOrig,
'Invalid number format: '//this%funcString(j+ib-1:j+in-2))
337 c = this%funcString(j:j)
339 n = variableindex(this%funcString(j:),this%variableNames,ib,in)
340 IF (n == 0) CALL parseerrmsg(j, this%funcStringOrig,
'Invalid element: '//this%funcString(j+ib-1:j+in-2))
343 c = this%funcString(j:j)
347 IF (parcnt < 0) CALL parseerrmsg(j, this%funcStringOrig,
'Mismatched parenthesis')
348 IF (this%funcString(j-1:j-1) ==
'(') CALL parseerrmsg(j-1, this%funcStringOrig,
'Empty parentheses')
351 c = this%funcString(j:j)
357 IF (any(c == ops))
THEN
358 IF (j+1 > lfunc) CALL parseerrmsg(j, this%funcStringOrig)
359 IF (any(this%funcString(j+1:j+1) == ops)) CALL parseerrmsg(j+1, this%funcStringOrig,
'Multiple operators')
361 CALL parseerrmsg(j, this%funcStringOrig,
'Missing operator')
369 IF (parcnt > 0) CALL parseerrmsg(j, this%funcStringOrig,
'Missing )')
370 END SUBROUTINE checksyntax
373 FUNCTION evalerrmsg(EvalErrType) RESULT (msg)
375 integer,
intent(in) :: evalerrtype
376 CHARACTER (LEN=*),
DIMENSION(4),
PARAMETER :: m = (/
'Division by zero ', &
377 'Argument of SQRT negative ', &
378 'Argument of LOG negative ', &
379 'Argument of ASIN or ACOS illegal' /)
380 CHARACTER (LEN=LEN(m)) :: msg
382 IF (evalerrtype < 1 .OR. evalerrtype >
SIZE(m))
THEN
388 END FUNCTION evalerrmsg
391 SUBROUTINE parseerrmsg (j, FuncStr, Msg)
393 INTEGER,
INTENT(in) :: j
394 CHARACTER (LEN=*),
INTENT(in) :: funcstr
395 CHARACTER (LEN=*),
OPTIONAL,
INTENT(in) :: msg
399 IF (present(msg))
THEN
400 WRITE(*,*)
'*** Error in syntax of function string: '//msg
402 WRITE(*,*)
'*** Error in syntax of function string:'
406 WRITE(*,
'(A)')
' '//funcstr
410 END SUBROUTINE parseerrmsg
413 FUNCTION operatorindex (c) RESULT (n)
415 CHARACTER (LEN=1),
INTENT(in) :: c
421 IF (c == ops(j))
THEN
427 END FUNCTION operatorindex
430 FUNCTION mathfunctionindex (str) RESULT (n)
432 CHARACTER (LEN=*),
INTENT(in) :: str
436 CHARACTER (LEN=LEN(Funcs)) ::
fun
441 k = min(len_trim(funcs(j)), len(str))
442 CALL lowcase(str(1:k),
fun)
443 IF (
fun == funcs(j))
THEN
449 END FUNCTION mathfunctionindex
452 FUNCTION variableindex (str, Var, ibegin, inext) RESULT (n)
457 CHARACTER (LEN=*),
INTENT(in) :: str
458 CHARACTER (LEN=*),
DIMENSION(:),
INTENT(in) :: var
460 INTEGER,
OPTIONAL,
INTENT(out) :: ibegin, &
462 INTEGER :: j,ib,in,lstr
468 IF (str(ib:ib) /=
' ')
EXIT
471 IF (scan(str(in:in),
'+-*/^) ') > 0)
EXIT
474 IF (str(ib:in-1) == var(j))
THEN
480 IF (present(ibegin)) ibegin = ib
481 IF (present(inext)) inext = in
482 END FUNCTION variableindex
485 SUBROUTINE removespaces (str)
487 CHARACTER (LEN=*),
INTENT(inout) :: str
495 DO WHILE (str(k:lstr) /=
' ')
496 IF (str(k:k) ==
' ')
THEN
497 str(k:lstr) = str(k+1:lstr)//
' '
503 END SUBROUTINE removespaces
506 SUBROUTINE replace (ca,cb,str)
508 CHARACTER (LEN=*),
INTENT(in) :: ca
509 CHARACTER (LEN=LEN(ca)),
INTENT(in) :: cb
510 CHARACTER (LEN=*),
INTENT(inout) :: str
516 DO j=1,len_trim(str)-lca+1
517 IF (str(j:j+lca-1) == ca) str(j:j+lca-1) = cb
520 END SUBROUTINE replace
523 SUBROUTINE compile(this)
525 class(equationparser) :: this
528 IF (
ASSOCIATED(this%ByteCode))
DEALLOCATE ( this%ByteCode, &
531 this%ByteCodeSize = 0
536 CALL this%CompileSubstr(1,len_trim(this%funcString))
538 ALLOCATE ( this%ByteCode(this%ByteCodeSize), &
539 this%Immed(this%ImmedSize), &
540 this%Stack(this%StackSize), &
543 WRITE(*,*)
'*** Parser error: Memmory allocation for byte code failed'
546 this%ByteCodeSize = 0
550 CALL this%CompileSubstr(1,len_trim(this%funcString))
553 END SUBROUTINE compile
556 SUBROUTINE addcompiledbyte(this, b)
558 class(equationparser) :: this
559 INTEGER(is),
INTENT(in) :: b
561 this%ByteCodeSize = this%ByteCodeSize + 1
563 IF (
ASSOCIATED(this%ByteCode))
then
564 this%ByteCode(this%ByteCodeSize) = b
567 END SUBROUTINE addcompiledbyte
570 FUNCTION mathitemindex(this, b, e) RESULT (n)
572 class(equationparser) :: this
574 INTEGER,
INTENT(in) :: b,e
579 IF (scan(this%funcString(b:b),
'0123456789.') > 0)
THEN
580 this%ImmedSize = this%ImmedSize + 1
581 IF (
ASSOCIATED(this%Immed)) this%Immed(this%ImmedSize) = realnum(this%funcString(b:e))
584 n = variableindex(this%funcString(b:e), this%variableNames)
585 IF (n > 0) n = varbegin+n-1
588 END FUNCTION mathitemindex
591 FUNCTION completelyenclosed (F, b, e) RESULT (res)
593 CHARACTER (LEN=*),
INTENT(in) :: f
594 INTEGER,
INTENT(in) :: b,e
601 IF (f(b:b) ==
'(' .AND. f(e:e) ==
')')
THEN
604 IF (f(j:j) ==
'(')
THEN
606 ELSEIF (f(j:j) ==
')')
THEN
611 IF (k == 0) res=.true.
614 END FUNCTION completelyenclosed
617 RECURSIVE SUBROUTINE compilesubstr(this, b, e)
619 class(equationparser) :: this
620 INTEGER,
INTENT(in) :: b,e
624 CHARACTER (LEN=*),
PARAMETER :: calpha =
'abcdefghijklmnopqrstuvwxyz'// &
625 'ABCDEFGHIJKLMNOPQRSTUVWXYZ'
628 IF (this%funcString(b:b) ==
'+')
THEN
630 CALL this%CompileSubstr(b+1, e)
632 ELSEIF (completelyenclosed(this%funcString, b, e))
THEN
634 CALL this%CompileSubstr(b+1, e-1)
636 ELSEIF (scan(this%funcString(b:b), calpha) > 0)
THEN
637 n = mathfunctionindex(this%funcString(b:e))
639 b2 = b+index(this%funcString(b:e),
'(')-1
640 IF (completelyenclosed(this%funcString,
b2, e))
THEN
642 CALL this%CompileSubstr(
b2+1, e-1)
643 CALL this%AddCompiledByte(n)
648 ELSEIF (this%funcString(b:b) ==
'-')
THEN
649 IF (completelyenclosed(this%funcString, b+1, e))
THEN
651 CALL this%CompileSubstr(b+2, e-1)
652 CALL this%AddCompiledByte(cneg)
654 ELSEIF (scan(this%funcString(b+1:b+1),calpha) > 0)
THEN
655 n = mathfunctionindex(this%funcString(b+1:e))
657 b2 = b+index(this%funcString(b+1:e),
'(')
658 IF (completelyenclosed(this%funcString,
b2, e))
THEN
660 CALL this%CompileSubstr(
b2+1, e-1);
661 CALL this%AddCompiledByte(n)
662 CALL this%AddCompiledByte(cneg)
674 IF (this%funcString(j:j) ==
')')
THEN
676 ELSEIF (this%funcString(j:j) ==
'(')
THEN
679 IF (k == 0 .AND. this%funcString(j:j) == ops(io) .AND. isbinaryop(j, this%funcString))
THEN
680 IF (any(this%funcString(j:j) == ops(cmul:cpow)) .AND. this%funcString(b:b) ==
'-')
THEN
682 CALL this%CompileSubstr(b+1, e)
683 CALL this%AddCompiledByte(cneg)
687 CALL this%CompileSubstr(b, j-1)
688 CALL this%CompileSubstr(j+1, e)
689 CALL this%AddCompiledByte(operatorindex(ops(io)))
690 this%StackPtr = this%StackPtr - 1
701 IF (this%funcString(b:b) ==
'-')
b2 =
b2+1
703 n = this%MathItemIndex(
b2, e)
706 CALL this%AddCompiledByte(n)
708 this%StackPtr = this%StackPtr + 1
709 IF (this%StackPtr > this%StackSize) this%StackSize = this%StackSize + 1
711 IF (
b2 > b) CALL this%AddCompiledByte(cneg)
713 END SUBROUTINE compilesubstr
716 FUNCTION isbinaryop (j, F) RESULT (res)
720 INTEGER,
INTENT(in) :: j
721 CHARACTER (LEN=*),
INTENT(in) :: f
725 LOGICAL :: dflag,pflag
729 IF (f(j:j) ==
'+' .OR. f(j:j) ==
'-')
THEN
732 ELSEIF (scan(f(j-1:j-1),
'+-*/^(') > 0)
THEN
734 ELSEIF (scan(f(j+1:j+1),
'0123456789') > 0 .AND. &
735 scan(f(j-1:j-1),
'eEdD') > 0)
THEN
736 dflag=.false.; pflag=.false.
740 IF (scan(f(k:k),
'0123456789') > 0)
THEN
742 ELSEIF (f(k:k) ==
'.')
THEN
752 IF (dflag .AND. (k == 1 .OR. scan(f(k:k),
'+-*/^(') > 0)) res = .false.
755 END FUNCTION isbinaryop
758 FUNCTION realnum(str, ibegin, inext, error) RESULT (res)
760 CHARACTER (LEN=*),
INTENT(in) :: str
762 INTEGER,
OPTIONAL,
INTENT(out) :: ibegin, &
764 LOGICAL,
OPTIONAL,
INTENT(out) :: error
766 INTEGER :: ib,in,istat
776 bflag=.true.; inman=.false.; pflag=.false.; eflag=.false.; inexp=.false.
777 dinman=.false.; dinexp=.false.
780 DO WHILE (in <= len_trim(str))
781 SELECT CASE (str(in:in))
784 IF (inman .OR. eflag .OR. inexp)
EXIT
787 inman=.true.; bflag=.false.
789 inexp=.true.; eflag=.false.
795 inman=.true.; bflag=.false.
797 inexp=.true.; eflag=.false.
799 IF (inman) dinman=.true.
800 IF (inexp) dinexp=.true.
804 inman=.true.; bflag=.false.
805 ELSEIF (inman .AND..NOT.pflag)
THEN
810 CASE (
'e',
'E',
'd',
'D')
812 eflag=.true.; inman=.false.
821 err = (ib > in-1) .OR. (.NOT.dinman) .OR. ((eflag.OR.inexp).AND..NOT.dinexp)
825 READ(str(ib:in-1),*,iostat=istat) res
828 IF (present(ibegin)) ibegin = ib
829 IF (present(inext)) inext = in
830 IF (present(error)) error = err
834 SUBROUTINE lowcase (str1, str2)
837 CHARACTER (LEN=*),
INTENT(in) :: str1
838 CHARACTER (LEN=*),
INTENT(out) :: str2
840 CHARACTER (LEN=*),
PARAMETER :: lc =
'abcdefghijklmnopqrstuvwxyz'
841 CHARACTER (LEN=*),
PARAMETER :: uc =
'ABCDEFGHIJKLMNOPQRSTUVWXYZ'
845 DO j=1,len_trim(str1)
846 k = index(uc,str1(j:j))
847 IF (k > 0) str2(j:j) = lc(k:k)
850 END SUBROUTINE lowcase
subroutine zero(x1, y1, x2, y2, func, err, x, y, izero, ll)
real(r8) function b2(a, x, xr, xs, yr, ys, psi, psir, F_dia)