ETS  \$Id: Doxyfile 2162 2020-02-26 14:16:09Z g2dpc $
 All Classes Files Functions Variables Pages
fortranparser.f90
Go to the documentation of this file.
1 !
2 ! Copyright (c) 2000-2008, Roland Schmehl. All rights reserved.
3 !
4 ! This software is distributable under the BSD license. See the terms of the
5 ! BSD license in the documentation provided with this software.
6 !
8  !------- -------- --------- --------- --------- --------- --------- --------- -------
9  ! Fortran 2008 function parser
10  !------- -------- --------- --------- --------- --------- --------- --------- -------
11  !
12  ! This is an OOP Fortran 2008 version of the original fparser by Roland Schmehl. This simple class
13  ! wrapping of the original fparser has been developed by Jacopo Chevallard, and it is available on
14  ! the GitHub repository https://github.com/jacopo-chevallard/FortranParser.
15  !
16  ! For comments and bug reports, please open an issue on
17  ! https://github.com/jacopo-chevallard/FortranParser/issues
18  !
19  ! This function parser module is intended for applications where a set of mathematical
20  ! fortran-style expressions is specified at runtime and is then evaluated for a large
21  ! number of variable values. This is done by compiling the set of function strings
22  ! into byte code, which is interpreted efficiently for the various variable values.
23  !
24  ! The source code of the original fparser is available from http://fparser.sourceforge.net
25  !
26  ! Please send comments, corrections or questions realtive to the original fparser to its author:
27  ! Roland Schmehl <roland.schmehl@alumni.uni-karlsruhe.de>
28  !
29  !------- -------- --------- --------- --------- --------- --------- --------- -------
30  ! The function parser concept is based on a C++ class library written by Juha
31  ! Nieminen <warp@iki.fi> available from http://warp.povusers.org/FunctionParser/
32  !------- -------- --------- --------- --------- --------- --------- --------- -------
33  USE fortranparser_parameters, ONLY: rn,is ! Import KIND parameters
34 
35  IMPLICIT NONE
36 
37  PUBLIC :: equationparser
38 
39  !------- -------- --------- --------- --------- --------- --------- --------- -------
40  PRIVATE
41 
42  INTEGER(is), PARAMETER :: cimmed = 1, &
43  cneg = 2, &
44  cadd = 3, &
45  csub = 4, &
46  cmul = 5, &
47  cdiv = 6, &
48  cpow = 7, &
49  cabs = 8, &
50  cexp = 9, &
51  clog10 = 10, &
52  clog = 11, &
53  csqrt = 12, &
54  csinh = 13, &
55  ccosh = 14, &
56  ctanh = 15, &
57  csin = 16, &
58  ccos = 17, &
59  ctan = 18, &
60  casin = 19, &
61  cacos = 20, &
62  catan = 21, &
63  varbegin = 22
64 
65  CHARACTER (LEN=1), DIMENSION(cAdd:cPow), PARAMETER :: ops = (/ '+', &
66  '-', &
67  '*', &
68  '/', &
69  '^' /)
70 
71  CHARACTER (LEN=5), DIMENSION(cAbs:cAtan), PARAMETER :: funcs = (/ 'abs ', &
72  'exp ', &
73  'log10', &
74  'log ', &
75  'sqrt ', &
76  'sinh ', &
77  'cosh ', &
78  'tanh ', &
79  'sin ', &
80  'cos ', &
81  'tan ', &
82  'asin ', &
83  'acos ', &
84  'atan ' /)
85 
86  INTEGER, parameter :: max_fun_length = 1024
87 
88  TYPE equationparser
89 
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
97 
98  character(len=MAX_FUN_LENGTH) :: funcstring = ''
99  character(len=MAX_FUN_LENGTH) :: funcstringorig = ''
100  character(len=MAX_FUN_LENGTH), allocatable :: variablenames(:)
101  contains
102 
103  private
104 
105  procedure, public :: evaluate
106  procedure:: parse
107  procedure :: compile
108  procedure :: addcompiledbyte
109  procedure :: compilesubstr
110  procedure :: mathitemindex
111  procedure :: checksyntax
112 
113  final :: finalize
114 
115  END TYPE equationparser
116 
117  ! Class constructor
118  interface equationparser
119  procedure constructor
120  end interface equationparser
121 
122 CONTAINS
123 
124 !*****************************************************************************************
125  type (equationparser) function constructor(funcstr, var)
126 
127  CHARACTER (LEN=*), INTENT(in) :: funcstr ! Function string
128  CHARACTER (LEN=*), DIMENSION(:), INTENT(in) :: var ! Array with variable names
129 
130  constructor%ByteCode => null()
131  constructor%Immed => null()
132  constructor%Stack => null()
133 
134  constructor%ByteCodeSize = 0
135  constructor%ImmedSize = 0
136  constructor%StackSize = 0
137  constructor%StackPtr = 0
138 
139  constructor%funcString = funcstr
140  constructor%funcStringOrig = funcstr
141 
142  allocate(constructor%variableNames(size(var)))
143 
144  constructor%variableNames(:) = var(:)
145 
146  call constructor%parse()
147 
148  end function constructor
149 
150 !*****************************************************************************************
151  subroutine finalize(this)
152 
153  type(equationparser) :: this
154 
155  if (associated(this%ByteCode)) nullify(this%ByteCode)
156  if (associated(this%Immed)) nullify(this%Immed)
157  if (associated(this%Stack)) nullify(this%Stack)
158 
159  end subroutine finalize
160 
161 !*****************************************************************************************
162  SUBROUTINE parse(this)
163  ! Parse ith function string FuncStr and compile it into bytecode
164  class(equationparser) :: this
165 
166  CALL replace('**','^ ', this%funcString) ! Exponent into 1-Char. format
167 
168  CALL removespaces(this%funcString) ! Condense function string
169 
170  CALL this%CheckSyntax()
171 
172  CALL this%Compile() ! Compile into bytecode
173 
174  END SUBROUTINE parse
175 
176 !*****************************************************************************************
177  FUNCTION evaluate(this, Val) RESULT (res)
178  ! Evaluate bytecode of ith function for the values passed in array Val(:)
179  class(equationparser) :: this
180  REAL(rn), DIMENSION(:), INTENT(in) :: val ! Variable values
181 
182  REAL(rn) :: res ! Result
183  INTEGER :: ip, & ! Instruction pointer
184  dp, & ! Data pointer
185  sp ! Stack pointer
186  REAL(rn), PARAMETER :: zero = 0._rn
187  integer :: evalerrtype
188 
189  dp = 1
190  sp = 0
191  evalerrtype=0
192 
193  DO ip=1,this%ByteCodeSize
194 
195  SELECT CASE (this%ByteCode(ip))
196 
197  CASE (cimmed); sp=sp+1; this%Stack(sp)=this%Immed(dp); dp=dp+1
198 
199  CASE (cneg); this%Stack(sp)=-this%Stack(sp)
200 
201  CASE (cadd); this%Stack(sp-1)=this%Stack(sp-1)+this%Stack(sp); sp=sp-1
202 
203  CASE (csub); this%Stack(sp-1)=this%Stack(sp-1)-this%Stack(sp); sp=sp-1
204 
205  CASE (cmul); this%Stack(sp-1)=this%Stack(sp-1)*this%Stack(sp); sp=sp-1
206 
207  CASE (cdiv)
208 
209  IF (this%Stack(sp)==0._rn) THEN
210  evalerrtype=1
211  res=zero
212  exit
213  ENDIF
214  this%Stack(sp-1)=this%Stack(sp-1)/this%Stack(sp); sp=sp-1
215 
216  CASE (cpow); this%Stack(sp-1)=this%Stack(sp-1)**this%Stack(sp); sp=sp-1
217 
218  CASE (cabs); this%Stack(sp)=abs(this%Stack(sp))
219 
220  CASE (cexp); this%Stack(sp)=exp(this%Stack(sp))
221 
222  CASE (clog10)
223 
224  IF (this%Stack(sp)<=0._rn) THEN
225  evalerrtype=3
226  res=zero
227  exit
228  ENDIF
229  this%Stack(sp)=log10(this%Stack(sp))
230 
231  CASE (clog)
232 
233  IF (this%Stack(sp)<=0._rn) THEN
234  evalerrtype=3
235  res=zero
236  exit
237  ENDIF
238  this%Stack(sp)=log(this%Stack(sp))
239 
240  CASE (csqrt)
241 
242  IF (this%Stack(sp)<0._rn) THEN
243  evalerrtype=3
244  res=zero
245  exit
246  ENDIF
247  this%Stack(sp)=sqrt(this%Stack(sp))
248 
249  CASE (csinh); this%Stack(sp)=sinh(this%Stack(sp))
250 
251  CASE (ccosh); this%Stack(sp)=cosh(this%Stack(sp))
252 
253  CASE (ctanh); this%Stack(sp)=tanh(this%Stack(sp))
254 
255  CASE (csin); this%Stack(sp)=sin(this%Stack(sp))
256 
257  CASE (ccos); this%Stack(sp)=cos(this%Stack(sp))
258 
259  CASE (ctan); this%Stack(sp)=tan(this%Stack(sp))
260 
261  CASE (casin)
262 
263  IF ((this%Stack(sp)<-1._rn) .OR. (this%Stack(sp)>1._rn)) THEN
264  evalerrtype=4
265  res=zero
266  exit
267  ENDIF
268  this%Stack(sp)=asin(this%Stack(sp))
269 
270  CASE (cacos);
271  IF ((this%Stack(sp)<-1._rn).OR.(this%Stack(sp)>1._rn)) THEN
272  evalerrtype=4
273  res=zero
274  exit
275  ENDIF
276  this%Stack(sp)=acos(this%Stack(sp))
277 
278  CASE (catan); this%Stack(sp)=atan(this%Stack(sp))
279 
280  CASE default; sp=sp+1; this%Stack(sp)=val(this%ByteCode(ip)-varbegin+1)
281 
282  END SELECT
283 
284  END DO
285 
286  IF (evalerrtype > 0) then
287  WRITE(*,*)'*** Error: ',evalerrmsg(evalerrtype)
288  else
289  res = this%Stack(1)
290  endif
291 
292  END FUNCTION evaluate
293 
294 !*****************************************************************************************
295  SUBROUTINE checksyntax(this)
296  ! Check syntax of function string, returns 0 if syntax is ok
297  class(equationparser) :: this
298  INTEGER(is) :: n
299  CHARACTER (LEN=1) :: c
300  REAL(rn) :: r
301  LOGICAL :: err
302  INTEGER :: parcnt, & ! Parenthesis counter
303  j,ib,in,lfunc
304 
305  j = 1
306  parcnt = 0
307  lfunc = len_trim(this%funcString)
308  step: DO
309  IF (j > lfunc) CALL parseerrmsg(j, this%funcStringOrig)
310  c = this%funcString(j:j)
311  !-- -------- --------- --------- --------- --------- --------- --------- -------
312  ! Check for valid operand (must appear)
313  !-- -------- --------- --------- --------- --------- --------- --------- -------
314  IF (c == '-' .OR. c == '+') THEN ! Check for leading - or +
315  j = j+1
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')
319  END IF
320  n = mathfunctionindex(this%funcString(j:))
321  IF (n > 0) THEN ! Check for math function
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')
326  END IF
327  IF (c == '(') THEN ! Check for opening parenthesis
328  parcnt = parcnt+1
329  j = j+1
330  cycle step
331  END IF
332  IF (scan(c,'0123456789.') > 0) THEN ! Check for number
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))
335  j = j+in-1
336  IF (j > lfunc) EXIT
337  c = this%funcString(j:j)
338  ELSE ! Check for variable
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))
341  j = j+in-1
342  IF (j > lfunc) EXIT
343  c = this%funcString(j:j)
344  END IF
345  DO WHILE (c == ')') ! Check for closing parenthesis
346  parcnt = parcnt-1
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')
349  j = j+1
350  IF (j > lfunc) EXIT
351  c = this%funcString(j:j)
352  END DO
353  !-- -------- --------- --------- --------- --------- --------- --------- -------
354  ! Now, we have a legal operand: A legal operator or end of string must follow
355  !-- -------- --------- --------- --------- --------- --------- --------- -------
356  IF (j > lfunc) EXIT
357  IF (any(c == ops)) THEN ! Check for multiple operators
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')
360  ELSE ! Check for next operand
361  CALL parseerrmsg(j, this%funcStringOrig, 'Missing operator')
362  END IF
363  !-- -------- --------- --------- --------- --------- --------- --------- -------
364  ! Now, we have an operand and an operator: the next loop will check for another
365  ! operand (must appear)
366  !-- -------- --------- --------- --------- --------- --------- --------- -------
367  j = j+1
368  END DO step
369  IF (parcnt > 0) CALL parseerrmsg(j, this%funcStringOrig, 'Missing )')
370  END SUBROUTINE checksyntax
371 
372 !*****************************************************************************************
373  FUNCTION evalerrmsg(EvalErrType) RESULT (msg)
374  ! Return error message
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
381  !----- -------- --------- --------- --------- --------- --------- --------- -------
382  IF (evalerrtype < 1 .OR. evalerrtype > SIZE(m)) THEN
383  msg = ''
384  ELSE
385  msg = m(evalerrtype)
386  ENDIF
387 
388  END FUNCTION evalerrmsg
389 
390 !*****************************************************************************************
391  SUBROUTINE parseerrmsg (j, FuncStr, Msg)
392  ! Print error message and terminate program
393  INTEGER, INTENT(in) :: j
394  CHARACTER (LEN=*), INTENT(in) :: funcstr ! Original function string
395  CHARACTER (LEN=*), OPTIONAL, INTENT(in) :: msg
396 
397  INTEGER :: k
398 
399  IF (present(msg)) THEN
400  WRITE(*,*) '*** Error in syntax of function string: '//msg
401  ELSE
402  WRITE(*,*) '*** Error in syntax of function string:'
403  ENDIF
404 
405  WRITE(*,*)
406  WRITE(*,'(A)') ' '//funcstr
407 
408  WRITE(*,'(A)') '?'
409  stop
410  END SUBROUTINE parseerrmsg
411 
412 !*****************************************************************************************
413  FUNCTION operatorindex (c) RESULT (n)
414  ! Return operator index
415  CHARACTER (LEN=1), INTENT(in) :: c
416  INTEGER(is) :: n,j
417 
418  n = 0
419 
420  DO j=cadd,cpow
421  IF (c == ops(j)) THEN
422  n = j
423  EXIT
424  END IF
425  END DO
426 
427  END FUNCTION operatorindex
428 
429 !*****************************************************************************************
430  FUNCTION mathfunctionindex (str) RESULT (n)
431  ! Return index of math function beginnig at 1st position of string str
432  CHARACTER (LEN=*), INTENT(in) :: str
433 
434  INTEGER(is) :: n,j
435  INTEGER :: k
436  CHARACTER (LEN=LEN(Funcs)) :: fun
437 
438  n = 0
439 
440  DO j=cabs,catan ! Check all math functions
441  k = min(len_trim(funcs(j)), len(str))
442  CALL lowcase(str(1:k), fun)
443  IF (fun == funcs(j)) THEN ! Compare lower case letters
444  n = j ! Found a matching function
445  EXIT
446  END IF
447  END DO
448 
449  END FUNCTION mathfunctionindex
450 
451 !*****************************************************************************************
452  FUNCTION variableindex (str, Var, ibegin, inext) RESULT (n)
453  !----- -------- --------- --------- --------- --------- --------- --------- -------
454  ! Return index of variable at begin of string str (returns 0 if no variable found)
455  !----- -------- --------- --------- --------- --------- --------- --------- -------
456  IMPLICIT NONE
457  CHARACTER (LEN=*), INTENT(in) :: str ! String
458  CHARACTER (LEN=*), DIMENSION(:), INTENT(in) :: var ! Array with variable names
459  INTEGER(is) :: n ! Index of variable
460  INTEGER, OPTIONAL, INTENT(out) :: ibegin, & ! Start position of variable name
461  inext ! Position of character after name
462  INTEGER :: j,ib,in,lstr
463  !----- -------- --------- --------- --------- --------- --------- --------- -------
464  n = 0
465  lstr = len_trim(str)
466  IF (lstr > 0) THEN
467  DO ib=1,lstr ! Search for first character in str
468  IF (str(ib:ib) /= ' ') EXIT ! When lstr>0 at least 1 char in str
469  END DO
470  DO in=ib,lstr ! Search for name terminators
471  IF (scan(str(in:in),'+-*/^) ') > 0) EXIT
472  END DO
473  DO j=1,SIZE(var)
474  IF (str(ib:in-1) == var(j)) THEN
475  n = j ! Variable name found
476  EXIT
477  END IF
478  END DO
479  END IF
480  IF (present(ibegin)) ibegin = ib
481  IF (present(inext)) inext = in
482  END FUNCTION variableindex
483 
484 !*****************************************************************************************
485  SUBROUTINE removespaces (str)
486  ! Remove Spaces from string, remember positions of characters in old string
487  CHARACTER (LEN=*), INTENT(inout) :: str
488 
489  INTEGER :: k,lstr
490 
491  lstr = len_trim(str)
492 
493  k = 1
494 
495  DO WHILE (str(k:lstr) /= ' ')
496  IF (str(k:k) == ' ') THEN
497  str(k:lstr) = str(k+1:lstr)//' ' ! Move 1 character to left
498  k = k-1
499  END IF
500  k = k+1
501  END DO
502 
503  END SUBROUTINE removespaces
504 
505 !*****************************************************************************************
506  SUBROUTINE replace (ca,cb,str)
507  ! Replace ALL appearances of character set ca in string str by character set cb
508  CHARACTER (LEN=*), INTENT(in) :: ca
509  CHARACTER (LEN=LEN(ca)), INTENT(in) :: cb ! LEN(ca) must be LEN(cb)
510  CHARACTER (LEN=*), INTENT(inout) :: str
511 
512  INTEGER :: j,lca
513 
514  lca = len(ca)
515 
516  DO j=1,len_trim(str)-lca+1
517  IF (str(j:j+lca-1) == ca) str(j:j+lca-1) = cb
518  END DO
519 
520  END SUBROUTINE replace
521 
522 !*****************************************************************************************
523  SUBROUTINE compile(this)
524  ! Compile i-th function string F into bytecode
525  class(equationparser) :: this
526  INTEGER :: istat
527 
528  IF (ASSOCIATED(this%ByteCode)) DEALLOCATE ( this%ByteCode, &
529  this%Immed, &
530  this%Stack )
531  this%ByteCodeSize = 0
532  this%ImmedSize = 0
533  this%StackSize = 0
534  this%StackPtr = 0
535 
536  CALL this%CompileSubstr(1,len_trim(this%funcString)) ! Compile string to determine size
537 
538  ALLOCATE ( this%ByteCode(this%ByteCodeSize), &
539  this%Immed(this%ImmedSize), &
540  this%Stack(this%StackSize), &
541  stat = istat )
542  IF (istat /= 0) THEN
543  WRITE(*,*) '*** Parser error: Memmory allocation for byte code failed'
544  stop
545  ELSE
546  this%ByteCodeSize = 0
547  this%ImmedSize = 0
548  this%StackSize = 0
549  this%StackPtr = 0
550  CALL this%CompileSubstr(1,len_trim(this%funcString)) ! Compile string into bytecode
551  END IF
552 
553  END SUBROUTINE compile
554 
555 !*****************************************************************************************
556  SUBROUTINE addcompiledbyte(this, b)
557  ! Add compiled byte to bytecode
558  class(equationparser) :: this
559  INTEGER(is), INTENT(in) :: b ! Value of byte to be added
560 
561  this%ByteCodeSize = this%ByteCodeSize + 1
562 
563  IF (ASSOCIATED(this%ByteCode)) then
564  this%ByteCode(this%ByteCodeSize) = b
565  endif
566 
567  END SUBROUTINE addcompiledbyte
568 
569 !*****************************************************************************************
570  FUNCTION mathitemindex(this, b, e) RESULT (n)
571  ! Return math item index, if item is real number, enter it into Comp-structure
572  class(equationparser) :: this
573 
574  INTEGER, INTENT(in) :: b,e ! First and last pos. of substring
575  INTEGER(is) :: n ! Byte value of math item
576 
577  n = 0
578 
579  IF (scan(this%funcString(b:b),'0123456789.') > 0) THEN ! Check for begin of a number
580  this%ImmedSize = this%ImmedSize + 1
581  IF (ASSOCIATED(this%Immed)) this%Immed(this%ImmedSize) = realnum(this%funcString(b:e))
582  n = cimmed
583  ELSE ! Check for a variable
584  n = variableindex(this%funcString(b:e), this%variableNames)
585  IF (n > 0) n = varbegin+n-1
586  END IF
587 
588  END FUNCTION mathitemindex
589 
590 !*****************************************************************************************
591  FUNCTION completelyenclosed (F, b, e) RESULT (res)
592  ! Check if function substring F(b:e) is completely enclosed by a pair of parenthesis
593  CHARACTER (LEN=*), INTENT(in) :: f ! Function substring
594  INTEGER, INTENT(in) :: b,e ! First and last pos. of substring
595 
596  LOGICAL :: res
597  INTEGER :: j,k
598 
599  res=.false.
600 
601  IF (f(b:b) == '(' .AND. f(e:e) == ')') THEN
602  k = 0
603  DO j=b+1,e-1
604  IF (f(j:j) == '(') THEN
605  k = k+1
606  ELSEIF (f(j:j) == ')') THEN
607  k = k-1
608  END IF
609  IF (k < 0) EXIT
610  END DO
611  IF (k == 0) res=.true. ! All opened parenthesis closed
612  END IF
613 
614  END FUNCTION completelyenclosed
615 
616 !*****************************************************************************************
617  RECURSIVE SUBROUTINE compilesubstr(this, b, e)
618  ! Compile i-th function string funcString into bytecode
619  class(equationparser) :: this
620  INTEGER, INTENT(in) :: b,e ! Begin and end position substring
621 
622  INTEGER(is) :: n
623  INTEGER :: b2,j,k,io
624  CHARACTER (LEN=*), PARAMETER :: calpha = 'abcdefghijklmnopqrstuvwxyz'// &
625  'ABCDEFGHIJKLMNOPQRSTUVWXYZ'
626  ! Check for special cases of substring
627 
628  IF (this%funcString(b:b) == '+') THEN ! Case 1: funcString(b:e) = '+...'
629 ! WRITE(*,*)'1. funcString(b:e) = "+..."'
630  CALL this%CompileSubstr(b+1, e)
631  RETURN
632  ELSEIF (completelyenclosed(this%funcString, b, e)) THEN ! Case 2: funcString(b:e) = '(...)'
633 ! WRITE(*,*)'2. funcString(b:e) = "(...)"'
634  CALL this%CompileSubstr(b+1, e-1)
635  RETURN
636  ELSEIF (scan(this%funcString(b:b), calpha) > 0) THEN
637  n = mathfunctionindex(this%funcString(b:e))
638  IF (n > 0) THEN
639  b2 = b+index(this%funcString(b:e),'(')-1
640  IF (completelyenclosed(this%funcString, b2, e)) THEN ! Case 3: funcString(b:e) = 'fcn(...)'
641 ! WRITE(*,*)'3. funcString(b:e) = "fcn(...)"'
642  CALL this%CompileSubstr(b2+1, e-1)
643  CALL this%AddCompiledByte(n)
644  RETURN
645  END IF
646  END IF
647 
648  ELSEIF (this%funcString(b:b) == '-') THEN
649  IF (completelyenclosed(this%funcString, b+1, e)) THEN ! Case 4: this%funcString(b:e) = '-(...)'
650 ! WRITE(*,*)'4. this%funcString(b:e) = "-(...)"'
651  CALL this%CompileSubstr(b+2, e-1)
652  CALL this%AddCompiledByte(cneg)
653  RETURN
654  ELSEIF (scan(this%funcString(b+1:b+1),calpha) > 0) THEN
655  n = mathfunctionindex(this%funcString(b+1:e))
656  IF (n > 0) THEN
657  b2 = b+index(this%funcString(b+1:e),'(')
658  IF (completelyenclosed(this%funcString, b2, e)) THEN ! Case 5: this%funcString(b:e) = '-fcn(...)'
659 ! WRITE(*,*)'5. this%funcString(b:e) = "-fcn(...)"'
660  CALL this%CompileSubstr(b2+1, e-1);
661  CALL this%AddCompiledByte(n)
662  CALL this%AddCompiledByte(cneg)
663  RETURN
664  END IF
665  END IF
666  ENDIF
667  END IF
668 
669  ! Check for operator in substring: check only base level (k=0), exclude expr. in ()
670 
671  DO io=cadd,cpow ! Increasing priority +-*/^
672  k = 0
673  DO j=e,b,-1
674  IF (this%funcString(j:j) == ')') THEN
675  k = k+1
676  ELSEIF (this%funcString(j:j) == '(') THEN
677  k = k-1
678  END IF
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 ! Case 6: this%funcString(b:e) = '-...Op...' with Op > -
681 ! WRITE(*,*)'6. this%funcString(b:e) = "-...Op..." with Op > -'
682  CALL this%CompileSubstr(b+1, e)
683  CALL this%AddCompiledByte(cneg)
684  RETURN
685  ELSE ! Case 7: this%funcString(b:e) = '...BinOp...'
686 ! WRITE(*,*)'7. Binary operator',this%funcString(j:j)
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
691  RETURN
692  END IF
693  END IF
694  END DO
695  END DO
696 
697  ! Check for remaining items, i.e. variables or explicit numbers
698 
699  b2 = b
700 
701  IF (this%funcString(b:b) == '-') b2 = b2+1
702 
703  n = this%MathItemIndex(b2, e)
704 
705 ! WRITE(*,*)'8. AddCompiledByte ',n
706  CALL this%AddCompiledByte(n)
707 
708  this%StackPtr = this%StackPtr + 1
709  IF (this%StackPtr > this%StackSize) this%StackSize = this%StackSize + 1
710 
711  IF (b2 > b) CALL this%AddCompiledByte(cneg)
712 
713  END SUBROUTINE compilesubstr
714 
715 !*****************************************************************************************
716  FUNCTION isbinaryop (j, F) RESULT (res)
717  ! Check if operator F(j:j) in string F is binary operator
718  ! Special cases already covered elsewhere: (that is corrected in v1.1)
719  ! - operator character F(j:j) is first character of string (j=1)
720  INTEGER, INTENT(in) :: j ! Position of Operator
721  CHARACTER (LEN=*), INTENT(in) :: f ! String
722 
723  LOGICAL :: res ! Result
724  INTEGER :: k
725  LOGICAL :: dflag,pflag
726 
727  res=.true.
728 
729  IF (f(j:j) == '+' .OR. f(j:j) == '-') THEN ! Plus or minus sign:
730  IF (j == 1) THEN ! - leading unary operator ?
731  res = .false.
732  ELSEIF (scan(f(j-1:j-1),'+-*/^(') > 0) THEN ! - other unary operator ?
733  res = .false.
734  ELSEIF (scan(f(j+1:j+1),'0123456789') > 0 .AND. & ! - in exponent of real number ?
735  scan(f(j-1:j-1),'eEdD') > 0) THEN
736  dflag=.false.; pflag=.false.
737  k = j-1
738  DO WHILE (k > 1) ! step to the left in mantissa
739  k = k-1
740  IF (scan(f(k:k),'0123456789') > 0) THEN
741  dflag=.true.
742  ELSEIF (f(k:k) == '.') THEN
743  IF (pflag) THEN
744  EXIT ! * EXIT: 2nd appearance of '.'
745  ELSE
746  pflag=.true. ! * mark 1st appearance of '.'
747  ENDIF
748  ELSE
749  EXIT ! * all other characters
750  END IF
751  END DO
752  IF (dflag .AND. (k == 1 .OR. scan(f(k:k),'+-*/^(') > 0)) res = .false.
753  END IF
754  END IF
755  END FUNCTION isbinaryop
756 
757 !*****************************************************************************************
758  FUNCTION realnum(str, ibegin, inext, error) RESULT (res)
759  ! Get real number from string - Format: [blanks][+|-][nnn][.nnn][e|E|d|D[+|-]nnn]
760  CHARACTER (LEN=*), INTENT(in) :: str ! String
761  REAL(rn) :: res ! Real number
762  INTEGER, OPTIONAL, INTENT(out) :: ibegin, & ! Start position of real number
763  inext ! 1st character after real number
764  LOGICAL, OPTIONAL, INTENT(out) :: error ! Error flag
765 
766  INTEGER :: ib,in,istat
767  LOGICAL :: bflag, & ! .T. at begin of number in str
768  inman, & ! .T. in mantissa of number
769  pflag, & ! .T. after 1st '.' encountered
770  eflag, & ! .T. at exponent identifier 'eEdD'
771  inexp, & ! .T. in exponent of number
772  dinman, & ! .T. if at least 1 digit in mant.
773  dinexp, & ! .T. if at least 1 digit in exp.
774  err ! Local error flag
775  !----- -------- --------- --------- --------- --------- --------- --------- -------
776  bflag=.true.; inman=.false.; pflag=.false.; eflag=.false.; inexp=.false.
777  dinman=.false.; dinexp=.false.
778  ib = 1
779  in = 1
780  DO WHILE (in <= len_trim(str))
781  SELECT CASE (str(in:in))
782  CASE (' ') ! Only leading blanks permitted
783  ib = ib+1
784  IF (inman .OR. eflag .OR. inexp) EXIT
785  CASE ('+','-') ! Permitted only
786  IF (bflag) THEN
787  inman=.true.; bflag=.false. ! - at beginning of mantissa
788  ELSEIF (eflag) THEN
789  inexp=.true.; eflag=.false. ! - at beginning of exponent
790  ELSE
791  EXIT ! - otherwise STOP
792  ENDIF
793  CASE ('0':'9') ! Mark
794  IF (bflag) THEN
795  inman=.true.; bflag=.false. ! - beginning of mantissa
796  ELSEIF (eflag) THEN
797  inexp=.true.; eflag=.false. ! - beginning of exponent
798  ENDIF
799  IF (inman) dinman=.true. ! Mantissa contains digit
800  IF (inexp) dinexp=.true. ! Exponent contains digit
801  CASE ('.')
802  IF (bflag) THEN
803  pflag=.true. ! - mark 1st appearance of '.'
804  inman=.true.; bflag=.false. ! mark beginning of mantissa
805  ELSEIF (inman .AND..NOT.pflag) THEN
806  pflag=.true. ! - mark 1st appearance of '.'
807  ELSE
808  EXIT ! - otherwise STOP
809  END IF
810  CASE ('e','E','d','D') ! Permitted only
811  IF (inman) THEN
812  eflag=.true.; inman=.false. ! - following mantissa
813  ELSE
814  EXIT ! - otherwise STOP
815  ENDIF
816  CASE default
817  EXIT ! STOP at all other characters
818  END SELECT
819  in = in+1
820  END DO
821  err = (ib > in-1) .OR. (.NOT.dinman) .OR. ((eflag.OR.inexp).AND..NOT.dinexp)
822  IF (err) THEN
823  res = 0.0_rn
824  ELSE
825  READ(str(ib:in-1),*,iostat=istat) res
826  err = istat /= 0
827  END IF
828  IF (present(ibegin)) ibegin = ib
829  IF (present(inext)) inext = in
830  IF (present(error)) error = err
831  END FUNCTION realnum
832 
833 !*****************************************************************************************
834  SUBROUTINE lowcase (str1, str2)
835  ! Transform upper case letters in str1 into lower case letters, result is str2
836  IMPLICIT NONE
837  CHARACTER (LEN=*), INTENT(in) :: str1
838  CHARACTER (LEN=*), INTENT(out) :: str2
839  INTEGER :: j,k
840  CHARACTER (LEN=*), PARAMETER :: lc = 'abcdefghijklmnopqrstuvwxyz'
841  CHARACTER (LEN=*), PARAMETER :: uc = 'ABCDEFGHIJKLMNOPQRSTUVWXYZ'
842 
843  str2 = str1
844 
845  DO j=1,len_trim(str1)
846  k = index(uc,str1(j:j))
847  IF (k > 0) str2(j:j) = lc(k:k)
848  END DO
849 
850  END SUBROUTINE lowcase
851 
852  END MODULE fortranparser
subroutine zero(x1, y1, x2, y2, func, err, x, y, izero, ll)
Definition: zero.f90:1
subroutine fun(X, F)
Definition: Ev2.f:10
real(r8) function b2(a, x, xr, xs, yr, ys, psi, psir, F_dia)