source: palm/trunk/UTIL/chemistry/gasphase_preproc/mechanisms/def_salsagas/chem_gasphase_mod.f90 @ 3789

Last change on this file since 3789 was 3789, checked in by forkel, 5 years ago

Removed unused variables from chem_gasphase_mod.f90

File size: 79.9 KB
Line 
1MODULE chem_gasphase_mod
2 
3!   Mechanism: salsagas
4!
5!------------------------------------------------------------------------------!
6!
7! ******Module chem_gasphase_mod is automatically generated by kpp4palm ******
8!
9!   *********Please do NOT change this Code,it will be ovewritten *********
10!
11!------------------------------------------------------------------------------!
12! This file was created by KPP (http://people.cs.vt.edu/asandu/Software/Kpp/)
13! and kpp4palm (created by Klaus Ketelsen). kpp4palm is an adapted version
14! of KP4 (Jöckel,P.,Kerkweg,A.,Pozzer,A.,Sander,R.,Tost,H.,Riede,
15! H.,Baumgaertner,A.,Gromov,S.,and Kern,B.,2010: Development cycle 2 of
16! the Modular Earth Submodel System (MESSy2),Geosci. Model Dev.,3,717-752,
17! https://doi.org/10.5194/gmd-3-717-2010). KP4 is part of the Modular Earth
18! Submodel System (MESSy),which is is available under the  GNU General Public
19! License (GPL).
20!
21! KPP is free software; you can redistribute it and/or modify it under the terms
22! of the General Public Licence as published by the Free Software Foundation;
23! either version 2 of the License,or (at your option) any later version.
24! KPP is distributed in the hope that it will be useful,but WITHOUT ANY WARRANTY;
25! without even the implied warranty of MERCHANTABILITY or FITNESS FOR A PARTICULAR
26! PURPOSE. See the GNU General Public Licence for more details.
27!
28!------------------------------------------------------------------------------!
29! This file is part of the PALM model system.
30!
31! PALM is free software: you can redistribute it and/or modify it under the
32! terms of the GNU General Public License as published by the Free Software
33! Foundation,either version 3 of the License,or (at your option) any later
34! version.
35!
36! PALM is distributed in the hope that it will be useful,but WITHOUT ANY
37! WARRANTY; without even the implied warranty of MERCHANTABILITY or FITNESS FOR
38! A PARTICULAR PURPOSE.  See the GNU General Public License for more details.
39!
40! You should have received a copy of the GNU General Public License along with
41! PALM. If not,see <http://www.gnu.org/licenses/>.
42!
43! Copyright 1997-2019 Leibniz Universitaet Hannover
44!--------------------------------------------------------------------------------!
45!
46!
47! MODULE HEADER TEMPLATE
48!
49!  Initial version (Nov. 2016,ketelsen),for later modifications of module_header
50!  see comments in kpp4palm/src/create_kpp_module.C
51
52! Set kpp Double Precision to PALM Default Precision
53
54  USE kinds,           ONLY: dp=>wp
55
56  USE pegrid,          ONLY: myid, threads_per_task
57
58  IMPLICIT        NONE
59  PRIVATE
60  !SAVE  ! note: occurs again in automatically generated code ...
61
62!  PUBLIC :: IERR_NAMES
63 
64! PUBLIC :: SPC_NAMES,EQN_NAMES,EQN_TAGS,REQ_HET,REQ_AEROSOL,REQ_PHOTRAT &
65!         ,REQ_MCFCT,IP_MAX,jname
66
67  PUBLIC :: cs_mech
68  PUBLIC :: eqn_names, phot_names, spc_names
69  PUBLIC :: nmaxfixsteps
70  PUBLIC :: atol, rtol
71  PUBLIC :: nspec, nreact
72  PUBLIC :: temp
73  PUBLIC :: qvap
74  PUBLIC :: fakt
75  PUBLIC :: phot 
76  PUBLIC :: rconst
77  PUBLIC :: nvar
78  PUBLIC :: nphot
79  PUBLIC :: vl_dim                     ! PUBLIC to ebable other MODULEs to distiguish between scalar and vec
80 
81  PUBLIC :: initialize, integrate, update_rconst
82  PUBLIC :: chem_gasphase_integrate
83  PUBLIC :: initialize_kpp_ctrl
84  PUBLIC :: get_mechanismname
85
86! END OF MODULE HEADER TEMPLATE
87                                                                 
88! Variables used for vector mode                                 
89                                                                 
90  LOGICAL, PARAMETER          :: l_vector = .FALSE.           
91  INTEGER, PARAMETER          :: i_lu_di = 2
92  INTEGER, PARAMETER          :: vl_dim = 1
93  INTEGER                     :: vl                             
94                                                                 
95  INTEGER                     :: vl_glo                         
96  INTEGER                     :: is, ie                           
97                                                                 
98                                                                 
99  LOGICAL                     :: data_loaded = .FALSE.             
100! ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
101!
102! Parameter Module File
103!
104! Generated by KPP-2.2.3 symbolic chemistry Kinetics PreProcessor
105!       (http://www.cs.vt.edu/~asandu/Software/KPP)
106! KPP is distributed under GPL,the general public licence
107!       (http://www.gnu.org/copyleft/gpl.html)
108! (C) 1995-1997,V. Damian & A. Sandu,CGRER,Univ. Iowa
109! (C) 1997-2005,A. Sandu,Michigan Tech,Virginia Tech
110!     With important contributions from:
111!        M. Damian,Villanova University,USA
112!        R. Sander,Max-Planck Institute for Chemistry,Mainz,Germany
113!
114! File                 : chem_gasphase_mod_Parameters.f90
115! Time                 : Fri Mar  8 19:01:01 2019
116! Working directory    : /home/forkel-r/palmstuff/work/trunk20190308/UTIL/chemistry/gasphase_preproc/tmp_kpp4palm
117! Equation file        : chem_gasphase_mod.kpp
118! Output root filename : chem_gasphase_mod
119!
120! ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
121
122
123
124
125
126
127! NSPEC - Number of chemical species
128  INTEGER, PARAMETER :: nspec = 5 
129! NVAR - Number of Variable species
130  INTEGER, PARAMETER :: nvar = 5 
131! NVARACT - Number of Active species
132  INTEGER, PARAMETER :: nvaract = 5 
133! NFIX - Number of Fixed species
134  INTEGER, PARAMETER :: nfix = 1 
135! NREACT - Number of reactions
136  INTEGER, PARAMETER :: nreact = 5 
137! NVARST - Starting of variables in conc. vect.
138  INTEGER, PARAMETER :: nvarst = 1 
139! NFIXST - Starting of fixed in conc. vect.
140  INTEGER, PARAMETER :: nfixst = 6 
141! NONZERO - Number of nonzero entries in Jacobian
142  INTEGER, PARAMETER :: nonzero = 5 
143! LU_NONZERO - Number of nonzero entries in LU factoriz. of Jacobian
144  INTEGER, PARAMETER :: lu_nonzero = 5 
145! CNVAR - (NVAR+1) Number of elements in compressed row format
146  INTEGER, PARAMETER :: cnvar = 6 
147! CNEQN - (NREACT+1) Number stoicm elements in compressed col format
148  INTEGER, PARAMETER :: cneqn = 6 
149! NHESS - Length of Sparse Hessian
150  INTEGER, PARAMETER :: nhess = 1 
151! NMASS - Number of atoms to check mass balance
152  INTEGER, PARAMETER :: nmass = 1 
153
154! Index declaration for variable species in C and VAR
155!   VAR(ind_spc) = C(ind_spc)
156
157  INTEGER, PARAMETER, PUBLIC :: ind_hno3 = 1 
158  INTEGER, PARAMETER, PUBLIC :: ind_h2so4 = 2 
159  INTEGER, PARAMETER, PUBLIC :: ind_nh3 = 3 
160  INTEGER, PARAMETER, PUBLIC :: ind_ocnv = 4 
161  INTEGER, PARAMETER, PUBLIC :: ind_ocsv = 5 
162
163! Index declaration for fixed species in C
164!   C(ind_spc)
165
166
167! Index declaration for fixed species in FIX
168!    FIX(indf_spc) = C(ind_spc) = C(NVAR+indf_spc)
169
170
171! NJVRP - Length of sparse Jacobian JVRP
172  INTEGER, PARAMETER :: njvrp = 5 
173
174! NSTOICM - Length of Sparse Stoichiometric Matrix
175  INTEGER, PARAMETER :: nstoicm = 1 
176
177
178! ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
179!
180! Global Data Module File
181!
182! Generated by KPP-2.2.3 symbolic chemistry Kinetics PreProcessor
183!       (http://www.cs.vt.edu/~asandu/Software/KPP)
184! KPP is distributed under GPL,the general public licence
185!       (http://www.gnu.org/copyleft/gpl.html)
186! (C) 1995-1997,V. Damian & A. Sandu,CGRER,Univ. Iowa
187! (C) 1997-2005,A. Sandu,Michigan Tech,Virginia Tech
188!     With important contributions from:
189!        M. Damian,Villanova University,USA
190!        R. Sander,Max-Planck Institute for Chemistry,Mainz,Germany
191!
192! File                 : chem_gasphase_mod_Global.f90
193! Time                 : Fri Mar  8 19:01:01 2019
194! Working directory    : /home/forkel-r/palmstuff/work/trunk20190308/UTIL/chemistry/gasphase_preproc/tmp_kpp4palm
195! Equation file        : chem_gasphase_mod.kpp
196! Output root filename : chem_gasphase_mod
197!
198! ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
199
200
201
202
203
204
205! Declaration of global variables
206
207! C - Concentration of all species
208  REAL(kind=dp):: c(nspec)
209! VAR - Concentrations of variable species (global)
210  REAL(kind=dp):: var(nvar)
211! FIX - Concentrations of fixed species (global)
212  REAL(kind=dp):: fix(nfix)
213! VAR,FIX are chunks of array C
214      EQUIVALENCE( c(1), var(1))
215! RCONST - Rate constants (global)
216  REAL(kind=dp):: rconst(nreact)
217! TIME - Current integration time
218  REAL(kind=dp):: time
219! TEMP - Temperature
220  REAL(kind=dp):: temp
221! ATOL - Absolute tolerance
222  REAL(kind=dp):: atol(nvar)
223! RTOL - Relative tolerance
224  REAL(kind=dp):: rtol(nvar)
225! STEPMIN - Lower bound for integration step
226  REAL(kind=dp):: stepmin
227! CFACTOR - Conversion factor for concentration units
228  REAL(kind=dp):: cfactor
229
230! INLINED global variable declarations
231
232  !   declaration of global variable declarations for photolysis will come from
233
234! QVAP - Water vapor
235  REAL(kind=dp):: qvap
236! FAKT - Conversion factor
237  REAL(kind=dp):: fakt
238
239! CS_MECH for check of mechanism name with namelist
240  CHARACTER(len=30):: cs_mech
241
242! INLINED global variable declarations
243
244
245
246! ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
247!
248! Sparse Jacobian Data Structures File
249!
250! Generated by KPP-2.2.3 symbolic chemistry Kinetics PreProcessor
251!       (http://www.cs.vt.edu/~asandu/Software/KPP)
252! KPP is distributed under GPL,the general public licence
253!       (http://www.gnu.org/copyleft/gpl.html)
254! (C) 1995-1997,V. Damian & A. Sandu,CGRER,Univ. Iowa
255! (C) 1997-2005,A. Sandu,Michigan Tech,Virginia Tech
256!     With important contributions from:
257!        M. Damian,Villanova University,USA
258!        R. Sander,Max-Planck Institute for Chemistry,Mainz,Germany
259!
260! File                 : chem_gasphase_mod_JacobianSP.f90
261! Time                 : Fri Mar  8 19:01:01 2019
262! Working directory    : /home/forkel-r/palmstuff/work/trunk20190308/UTIL/chemistry/gasphase_preproc/tmp_kpp4palm
263! Equation file        : chem_gasphase_mod.kpp
264! Output root filename : chem_gasphase_mod
265!
266! ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
267
268
269
270
271
272
273! Sparse Jacobian Data
274
275
276  INTEGER, PARAMETER, DIMENSION(5):: lu_irow =  (/ &
277       1, 2, 3, 4, 5 /) 
278
279  INTEGER, PARAMETER, DIMENSION(5):: lu_icol =  (/ &
280       1, 2, 3, 4, 5 /) 
281
282  INTEGER, PARAMETER, DIMENSION(6):: lu_crow =  (/ &
283       1, 2, 3, 4, 5, 6 /) 
284
285  INTEGER, PARAMETER, DIMENSION(6):: lu_diag =  (/ &
286       1, 2, 3, 4, 5, 6 /) 
287
288
289
290! ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
291!
292! Utility Data Module File
293!
294! Generated by KPP-2.2.3 symbolic chemistry Kinetics PreProcessor
295!       (http://www.cs.vt.edu/~asandu/Software/KPP)
296! KPP is distributed under GPL,the general public licence
297!       (http://www.gnu.org/copyleft/gpl.html)
298! (C) 1995-1997,V. Damian & A. Sandu,CGRER,Univ. Iowa
299! (C) 1997-2005,A. Sandu,Michigan Tech,Virginia Tech
300!     With important contributions from:
301!        M. Damian,Villanova University,USA
302!        R. Sander,Max-Planck Institute for Chemistry,Mainz,Germany
303!
304! File                 : chem_gasphase_mod_Monitor.f90
305! Time                 : Fri Mar  8 19:01:01 2019
306! Working directory    : /home/forkel-r/palmstuff/work/trunk20190308/UTIL/chemistry/gasphase_preproc/tmp_kpp4palm
307! Equation file        : chem_gasphase_mod.kpp
308! Output root filename : chem_gasphase_mod
309!
310! ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
311
312
313
314
315
316  CHARACTER(len=15), PARAMETER, DIMENSION(5):: spc_names =  (/ &
317     'HNO3           ','H2SO4          ','NH3            ',&
318     'OCNV           ','OCSV           ' /)
319
320  CHARACTER(len=100), PARAMETER, DIMENSION(5):: eqn_names =  (/ &
321     'H2SO4 --> H2SO4                                                                                     ',&
322     ' HNO3 --> HNO3                                                                                      ',&
323     '  NH3 --> NH3                                                                                       ',&
324     ' OCNV --> OCNV                                                                                      ',&
325     ' OCSV --> OCSV                                                                                      ' /)
326
327! INLINED global variables
328
329  !   inline f90_data: declaration of global variables for photolysis
330  !   REAL(kind=dp):: phot(nphot)must eventually be moved to global later for
331  INTEGER, PARAMETER :: nphot = 1
332  !   phot photolysis frequencies
333  REAL(kind=dp):: phot(nphot)
334
335  INTEGER, PARAMETER, PUBLIC :: j_no2 = 1
336
337  CHARACTER(len=15), PARAMETER, DIMENSION(nphot):: phot_names =   (/ &
338     'J_NO2          '/)
339
340! End INLINED global variables
341
342
343! Automatic generated PUBLIC Statements for ip_ and ihs_ variables
344 
345! Automatic generated PUBLIC Statements for ip_ and ihs_ variables
346 
347! Automatic generated PUBLIC Statements for ip_ and ihs_ variables
348 
349! Automatic generated PUBLIC Statements for ip_ and ihs_ variables
350 
351 
352!  variable definations from  individual module headers
353 
354! ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
355!
356! Initialization File
357!
358! Generated by KPP-2.2.3 symbolic chemistry Kinetics PreProcessor
359!       (http://www.cs.vt.edu/~asandu/Software/KPP)
360! KPP is distributed under GPL,the general public licence
361!       (http://www.gnu.org/copyleft/gpl.html)
362! (C) 1995-1997,V. Damian & A. Sandu,CGRER,Univ. Iowa
363! (C) 1997-2005,A. Sandu,Michigan Tech,Virginia Tech
364!     With important contributions from:
365!        M. Damian,Villanova University,USA
366!        R. Sander,Max-Planck Institute for Chemistry,Mainz,Germany
367!
368! File                 : chem_gasphase_mod_Initialize.f90
369! Time                 : Fri Mar  8 19:01:01 2019
370! Working directory    : /home/forkel-r/palmstuff/work/trunk20190308/UTIL/chemistry/gasphase_preproc/tmp_kpp4palm
371! Equation file        : chem_gasphase_mod.kpp
372! Output root filename : chem_gasphase_mod
373!
374! ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
375
376
377
378
379
380! ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
381!
382! Numerical Integrator (Time-Stepping) File
383!
384! Generated by KPP-2.2.3 symbolic chemistry Kinetics PreProcessor
385!       (http://www.cs.vt.edu/~asandu/Software/KPP)
386! KPP is distributed under GPL,the general public licence
387!       (http://www.gnu.org/copyleft/gpl.html)
388! (C) 1995-1997,V. Damian & A. Sandu,CGRER,Univ. Iowa
389! (C) 1997-2005,A. Sandu,Michigan Tech,Virginia Tech
390!     With important contributions from:
391!        M. Damian,Villanova University,USA
392!        R. Sander,Max-Planck Institute for Chemistry,Mainz,Germany
393!
394! File                 : chem_gasphase_mod_Integrator.f90
395! Time                 : Fri Mar  8 19:01:01 2019
396! Working directory    : /home/forkel-r/palmstuff/work/trunk20190308/UTIL/chemistry/gasphase_preproc/tmp_kpp4palm
397! Equation file        : chem_gasphase_mod.kpp
398! Output root filename : chem_gasphase_mod
399!
400! ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
401
402
403
404! ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
405!
406! INTEGRATE - Integrator routine
407!   Arguments :
408!      TIN       - Start Time for Integration
409!      TOUT      - End Time for Integration
410!
411! ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
412
413!~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~!
414!  Rosenbrock - Implementation of several Rosenbrock methods:             !
415!               *Ros2                                                    !
416!               *Ros3                                                    !
417!               *Ros4                                                    !
418!               *Rodas3                                                  !
419!               *Rodas4                                                  !
420!  By default the code employs the KPP sparse linear algebra routines     !
421!  Compile with -DFULL_ALGEBRA to use full linear algebra (LAPACK)        !
422!                                                                         !
423!    (C)  Adrian Sandu,August 2004                                       !
424!    Virginia Polytechnic Institute and State University                  !
425!    Contact: sandu@cs.vt.edu                                             !
426!    Revised by Philipp Miehe and Adrian Sandu,May 2006                  !                               !
427!    This implementation is part of KPP - the Kinetic PreProcessor        !
428!~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~!
429
430
431  SAVE
432 
433!~~~>  statistics on the work performed by the rosenbrock method
434  INTEGER, PARAMETER :: nfun=1, njac=2, nstp=3, nacc=4, &
435                        nrej=5, ndec=6, nsol=7, nsng=8, &
436                        ntexit=1, nhexit=2, nhnew = 3
437
438! ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
439!
440! Linear Algebra Data and Routines File
441!
442! Generated by KPP-2.2.3 symbolic chemistry Kinetics PreProcessor
443!       (http://www.cs.vt.edu/~asandu/Software/KPP)
444! KPP is distributed under GPL,the general public licence
445!       (http://www.gnu.org/copyleft/gpl.html)
446! (C) 1995-1997,V. Damian & A. Sandu,CGRER,Univ. Iowa
447! (C) 1997-2005,A. Sandu,Michigan Tech,Virginia Tech
448!     With important contributions from:
449!        M. Damian,Villanova University,USA
450!        R. Sander,Max-Planck Institute for Chemistry,Mainz,Germany
451!
452! File                 : chem_gasphase_mod_LinearAlgebra.f90
453! Time                 : Fri Mar  8 19:01:01 2019
454! Working directory    : /home/forkel-r/palmstuff/work/trunk20190308/UTIL/chemistry/gasphase_preproc/tmp_kpp4palm
455! Equation file        : chem_gasphase_mod.kpp
456! Output root filename : chem_gasphase_mod
457!
458! ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
459
460
461
462
463
464
465! ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
466!
467! The ODE Jacobian of Chemical Model File
468!
469! Generated by KPP-2.2.3 symbolic chemistry Kinetics PreProcessor
470!       (http://www.cs.vt.edu/~asandu/Software/KPP)
471! KPP is distributed under GPL,the general public licence
472!       (http://www.gnu.org/copyleft/gpl.html)
473! (C) 1995-1997,V. Damian & A. Sandu,CGRER,Univ. Iowa
474! (C) 1997-2005,A. Sandu,Michigan Tech,Virginia Tech
475!     With important contributions from:
476!        M. Damian,Villanova University,USA
477!        R. Sander,Max-Planck Institute for Chemistry,Mainz,Germany
478!
479! File                 : chem_gasphase_mod_Jacobian.f90
480! Time                 : Fri Mar  8 19:01:01 2019
481! Working directory    : /home/forkel-r/palmstuff/work/trunk20190308/UTIL/chemistry/gasphase_preproc/tmp_kpp4palm
482! Equation file        : chem_gasphase_mod.kpp
483! Output root filename : chem_gasphase_mod
484!
485! ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
486
487
488
489
490
491
492! ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
493!
494! The ODE Function of Chemical Model File
495!
496! Generated by KPP-2.2.3 symbolic chemistry Kinetics PreProcessor
497!       (http://www.cs.vt.edu/~asandu/Software/KPP)
498! KPP is distributed under GPL,the general public licence
499!       (http://www.gnu.org/copyleft/gpl.html)
500! (C) 1995-1997,V. Damian & A. Sandu,CGRER,Univ. Iowa
501! (C) 1997-2005,A. Sandu,Michigan Tech,Virginia Tech
502!     With important contributions from:
503!        M. Damian,Villanova University,USA
504!        R. Sander,Max-Planck Institute for Chemistry,Mainz,Germany
505!
506! File                 : chem_gasphase_mod_Function.f90
507! Time                 : Fri Mar  8 19:01:01 2019
508! Working directory    : /home/forkel-r/palmstuff/work/trunk20190308/UTIL/chemistry/gasphase_preproc/tmp_kpp4palm
509! Equation file        : chem_gasphase_mod.kpp
510! Output root filename : chem_gasphase_mod
511!
512! ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
513
514
515
516
517
518! A - Rate for each equation
519  REAL(kind=dp):: a(nreact)
520
521! ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
522!
523! The Reaction Rates File
524!
525! Generated by KPP-2.2.3 symbolic chemistry Kinetics PreProcessor
526!       (http://www.cs.vt.edu/~asandu/Software/KPP)
527! KPP is distributed under GPL,the general public licence
528!       (http://www.gnu.org/copyleft/gpl.html)
529! (C) 1995-1997,V. Damian & A. Sandu,CGRER,Univ. Iowa
530! (C) 1997-2005,A. Sandu,Michigan Tech,Virginia Tech
531!     With important contributions from:
532!        M. Damian,Villanova University,USA
533!        R. Sander,Max-Planck Institute for Chemistry,Mainz,Germany
534!
535! File                 : chem_gasphase_mod_Rates.f90
536! Time                 : Fri Mar  8 19:01:01 2019
537! Working directory    : /home/forkel-r/palmstuff/work/trunk20190308/UTIL/chemistry/gasphase_preproc/tmp_kpp4palm
538! Equation file        : chem_gasphase_mod.kpp
539! Output root filename : chem_gasphase_mod
540!
541! ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
542
543
544
545
546
547! ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
548!
549! Auxiliary Routines File
550!
551! Generated by KPP-2.2.3 symbolic chemistry Kinetics PreProcessor
552!       (http://www.cs.vt.edu/~asandu/Software/KPP)
553! KPP is distributed under GPL,the general public licence
554!       (http://www.gnu.org/copyleft/gpl.html)
555! (C) 1995-1997,V. Damian & A. Sandu,CGRER,Univ. Iowa
556! (C) 1997-2005,A. Sandu,Michigan Tech,Virginia Tech
557!     With important contributions from:
558!        M. Damian,Villanova University,USA
559!        R. Sander,Max-Planck Institute for Chemistry,Mainz,Germany
560!
561! File                 : chem_gasphase_mod_Util.f90
562! Time                 : Fri Mar  8 19:01:01 2019
563! Working directory    : /home/forkel-r/palmstuff/work/trunk20190308/UTIL/chemistry/gasphase_preproc/tmp_kpp4palm
564! Equation file        : chem_gasphase_mod.kpp
565! Output root filename : chem_gasphase_mod
566!
567! ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
568
569
570
571
572
573
574  ! header MODULE initialize_kpp_ctrl_template
575
576  ! notes:
577  ! - l_vector is automatically defined by kp4
578  ! - vl_dim is automatically defined by kp4
579  ! - i_lu_di is automatically defined by kp4
580  ! - wanted is automatically defined by xmecca
581  ! - icntrl rcntrl are automatically defined by kpp
582  ! - "USE messy_main_tools" is in MODULE_header of messy_mecca_kpp.f90
583  ! - SAVE will be automatically added by kp4
584
585  !SAVE
586
587  ! for fixed time step control
588  ! ... max. number of fixed time steps (sum must be 1)
589  INTEGER, PARAMETER         :: nmaxfixsteps = 50
590  ! ... switch for fixed time stepping
591  LOGICAL, PUBLIC            :: l_fixed_step = .FALSE.
592  INTEGER, PUBLIC            :: nfsteps = 1
593  ! ... number of kpp control PARAMETERs
594  INTEGER, PARAMETER, PUBLIC :: nkppctrl = 20
595  !
596  INTEGER, DIMENSION(nkppctrl), PUBLIC     :: icntrl = 0
597  REAL(dp), DIMENSION(nkppctrl), PUBLIC     :: rcntrl = 0.0_dp
598  REAL(dp), DIMENSION(nmaxfixsteps), PUBLIC :: t_steps = 0.0_dp
599
600  ! END header MODULE initialize_kpp_ctrl_template
601
602 
603! Interface Block
604 
605  INTERFACE            initialize
606    MODULE PROCEDURE   initialize
607  END INTERFACE        initialize
608 
609  INTERFACE            integrate
610    MODULE PROCEDURE   integrate
611  END INTERFACE        integrate
612 
613  INTERFACE            fun
614    MODULE PROCEDURE   fun
615  END INTERFACE        fun
616 
617  INTERFACE            kppsolve
618    MODULE PROCEDURE   kppsolve
619  END INTERFACE        kppsolve
620 
621  INTERFACE            jac_sp
622    MODULE PROCEDURE   jac_sp
623  END INTERFACE        jac_sp
624 
625  INTERFACE            k_arr
626    MODULE PROCEDURE   k_arr
627  END INTERFACE        k_arr
628 
629  INTERFACE            update_rconst
630    MODULE PROCEDURE   update_rconst
631  END INTERFACE        update_rconst
632 
633  INTERFACE            arr2
634    MODULE PROCEDURE   arr2
635  END INTERFACE        arr2
636 
637  INTERFACE            initialize_kpp_ctrl
638    MODULE PROCEDURE   initialize_kpp_ctrl
639  END INTERFACE        initialize_kpp_ctrl
640 
641  INTERFACE            error_output
642    MODULE PROCEDURE   error_output
643  END INTERFACE        error_output
644 
645  INTERFACE            wscal
646    MODULE PROCEDURE   wscal
647  END INTERFACE        wscal
648 
649!INTERFACE not working  INTERFACE            waxpy
650!INTERFACE not working    MODULE PROCEDURE   waxpy
651!INTERFACE not working  END INTERFACE        waxpy
652 
653  INTERFACE            rosenbrock
654    MODULE PROCEDURE   rosenbrock
655  END INTERFACE        rosenbrock
656 
657  INTERFACE            funtemplate
658    MODULE PROCEDURE   funtemplate
659  END INTERFACE        funtemplate
660 
661  INTERFACE            jactemplate
662    MODULE PROCEDURE   jactemplate
663  END INTERFACE        jactemplate
664 
665  INTERFACE            kppdecomp
666    MODULE PROCEDURE   kppdecomp
667  END INTERFACE        kppdecomp
668 
669  INTERFACE            get_mechanismname
670    MODULE PROCEDURE   get_mechanismname
671  END INTERFACE        get_mechanismname
672 
673  INTERFACE            chem_gasphase_integrate
674    MODULE PROCEDURE   chem_gasphase_integrate
675  END INTERFACE        chem_gasphase_integrate
676 
677 
678 CONTAINS
679 
680SUBROUTINE initialize()
681
682
683 INTEGER         :: k
684
685  INTEGER :: i
686  REAL(kind=dp):: x
687  k = is
688  cfactor = 1.000000e+00_dp
689
690  x = (0.) * cfactor
691  DO i = 1 , nvar
692  ENDDO
693
694  x = (0.) * cfactor
695  DO i = 1 , nfix
696    fix(i) = x
697  ENDDO
698
699! constant rate coefficients
700! END constant rate coefficients
701
702! INLINED initializations
703
704! End INLINED initializations
705
706     
707END SUBROUTINE initialize
708 
709SUBROUTINE integrate( tin, tout, &
710  icntrl_u, rcntrl_u, istatus_u, rstatus_u, ierr_u)
711
712
713   REAL(kind=dp), INTENT(IN):: tin  ! start time
714   REAL(kind=dp), INTENT(IN):: tout ! END time
715   ! OPTIONAL input PARAMETERs and statistics
716   INTEGER,      INTENT(IN), OPTIONAL :: icntrl_u(20)
717   REAL(kind=dp), INTENT(IN), OPTIONAL :: rcntrl_u(20)
718   INTEGER,      INTENT(OUT), OPTIONAL :: istatus_u(20)
719   REAL(kind=dp), INTENT(OUT), OPTIONAL :: rstatus_u(20)
720   INTEGER,      INTENT(OUT), OPTIONAL :: ierr_u
721
722   REAL(kind=dp):: rcntrl(20), rstatus(20)
723   INTEGER       :: icntrl(20), istatus(20), ierr
724
725
726   icntrl(:) = 0
727   rcntrl(:) = 0.0_dp
728   istatus(:) = 0
729   rstatus(:) = 0.0_dp
730
731    !~~~> fine-tune the integrator:
732   icntrl(1) = 0      ! 0 - non- autonomous, 1 - autonomous
733   icntrl(2) = 0      ! 0 - vector tolerances, 1 - scalars
734
735   ! IF OPTIONAL PARAMETERs are given, and IF they are >0,
736   ! THEN they overwrite default settings.
737   IF (PRESENT(icntrl_u))THEN
738     WHERE(icntrl_u(:)> 0)icntrl(:) = icntrl_u(:)
739   ENDIF
740   IF (PRESENT(rcntrl_u))THEN
741     WHERE(rcntrl_u(:)> 0)rcntrl(:) = rcntrl_u(:)
742   ENDIF
743
744
745   CALL rosenbrock(nvar, var, tin, tout,  &
746         atol, rtol,               &
747         rcntrl, icntrl, rstatus, istatus, ierr)
748
749   !~~~> debug option: show no of steps
750   ! ntotal = ntotal + istatus(nstp)
751   ! PRINT*,'NSTEPS=',ISTATUS(Nstp),' (',Ntotal,')','  O3=',VAR(ind_O3)
752
753   stepmin = rstatus(nhexit)
754   ! IF OPTIONAL PARAMETERs are given for output they
755   ! are updated with the RETURN information
756   IF (PRESENT(istatus_u))istatus_u(:) = istatus(:)
757   IF (PRESENT(rstatus_u))rstatus_u(:) = rstatus(:)
758   IF (PRESENT(ierr_u))  ierr_u       = ierr
759
760END SUBROUTINE integrate
761 
762SUBROUTINE fun(v, f, rct, vdot)
763
764! V - Concentrations of variable species (local)
765  REAL(kind=dp):: v(nvar)
766! F - Concentrations of fixed species (local)
767  REAL(kind=dp):: f(nfix)
768! RCT - Rate constants (local)
769  REAL(kind=dp):: rct(nreact)
770! Vdot - Time derivative of variable species concentrations
771  REAL(kind=dp):: vdot(nvar)
772
773
774! Computation of equation rates
775
776! Aggregate function
777  vdot(1) = 0
778  vdot(2) = 0
779  vdot(3) = 0
780  vdot(4) = 0
781  vdot(5) = 0
782     
783END SUBROUTINE fun
784 
785SUBROUTINE kppsolve(jvs, x)
786
787! JVS - sparse Jacobian of variables
788  REAL(kind=dp):: jvs(lu_nonzero)
789! X - Vector for variables
790  REAL(kind=dp):: x(nvar)
791
792  x(5) = x(5) / jvs(5)
793  x(4) = x(4) / jvs(4)
794  x(3) = x(3) / jvs(3)
795  x(2) = x(2) / jvs(2)
796  x(1) = x(1) / jvs(1)
797     
798END SUBROUTINE kppsolve
799 
800SUBROUTINE jac_sp(v, f, rct, jvs)
801
802! V - Concentrations of variable species (local)
803  REAL(kind=dp):: v(nvar)
804! F - Concentrations of fixed species (local)
805  REAL(kind=dp):: f(nfix)
806! RCT - Rate constants (local)
807  REAL(kind=dp):: rct(nreact)
808! JVS - sparse Jacobian of variables
809  REAL(kind=dp):: jvs(lu_nonzero)
810
811
812! Local variables
813! B - Temporary array
814  REAL(kind=dp):: b(5)
815
816! B(1) = dA(1)/dV(2)
817  b(1) = rct(1)
818! B(2) = dA(2)/dV(1)
819  b(2) = rct(2)
820! B(3) = dA(3)/dV(3)
821  b(3) = rct(3)
822! B(4) = dA(4)/dV(4)
823  b(4) = rct(4)
824! B(5) = dA(5)/dV(5)
825  b(5) = rct(5)
826
827! Construct the Jacobian terms from B's
828! JVS(1) = Jac_FULL(1,1)
829  jvs(1) = 0
830! JVS(2) = Jac_FULL(2,2)
831  jvs(2) = 0
832! JVS(3) = Jac_FULL(3,3)
833  jvs(3) = 0
834! JVS(4) = Jac_FULL(4,4)
835  jvs(4) = 0
836! JVS(5) = Jac_FULL(5,5)
837  jvs(5) = 0
838     
839END SUBROUTINE jac_sp
840 
841  elemental REAL(kind=dp)FUNCTION k_arr (k_298, tdep, temp)
842    ! arrhenius FUNCTION
843
844    REAL,    INTENT(IN):: k_298 ! k at t = 298.15k
845    REAL,    INTENT(IN):: tdep  ! temperature dependence
846    REAL(kind=dp), INTENT(IN):: temp  ! temperature
847
848    intrinsic exp
849
850    k_arr = k_298 * exp(tdep* (1._dp/temp- 3.3540e-3_dp))! 1/298.15=3.3540e-3
851
852  END FUNCTION k_arr
853 
854SUBROUTINE update_rconst()
855 INTEGER         :: k
856
857  k = is
858
859! Begin INLINED RCONST
860
861
862! End INLINED RCONST
863
864  rconst(1) = (1.0_dp)
865  rconst(2) = (1.0_dp)
866  rconst(3) = (1.0_dp)
867  rconst(4) = (1.0_dp)
868  rconst(5) = (1.0_dp)
869     
870END SUBROUTINE update_rconst
871 
872!  END FUNCTION ARR2
873REAL(kind=dp)FUNCTION arr2( a0, b0, temp)
874    REAL(kind=dp):: temp
875    REAL(kind=dp):: a0, b0
876    arr2 = a0 * exp( - b0 / temp)
877END FUNCTION arr2
878 
879SUBROUTINE initialize_kpp_ctrl(status)
880
881
882  ! i/o
883  INTEGER,         INTENT(OUT):: status
884
885  ! local
886  REAL(dp):: tsum
887  INTEGER  :: i
888
889  ! check fixed time steps
890  tsum = 0.0_dp
891  DO i=1, nmaxfixsteps
892     IF (t_steps(i)< tiny(0.0_dp))exit
893     tsum = tsum + t_steps(i)
894  ENDDO
895
896  nfsteps = i- 1
897
898  l_fixed_step = (nfsteps > 0).and.((tsum - 1.0)< tiny(0.0_dp))
899
900  IF (l_vector)THEN
901     WRITE(*,*) ' MODE             : VECTOR (LENGTH=',VL_DIM,')'
902  ELSE
903     WRITE(*,*) ' MODE             : SCALAR'
904  ENDIF
905  !
906  WRITE(*,*) ' DE-INDEXING MODE :',I_LU_DI
907  !
908  WRITE(*,*) ' ICNTRL           : ',icntrl
909  WRITE(*,*) ' RCNTRL           : ',rcntrl
910  !
911  ! note: this is ONLY meaningful for vectorized (kp4)rosenbrock- methods
912  IF (l_vector)THEN
913     IF (l_fixed_step)THEN
914        WRITE(*,*) ' TIME STEPS       : FIXED (',t_steps(1:nfsteps),')'
915     ELSE
916        WRITE(*,*) ' TIME STEPS       : AUTOMATIC'
917     ENDIF
918  ELSE
919     WRITE(*,*) ' TIME STEPS       : AUTOMATIC '//&
920          &'(t_steps (CTRL_KPP) ignored in SCALAR MODE)'
921  ENDIF
922  ! mz_pj_20070531-
923
924  status = 0
925
926
927END SUBROUTINE initialize_kpp_ctrl
928 
929SUBROUTINE error_output(c, ierr, pe)
930
931
932  INTEGER, INTENT(IN):: ierr
933  INTEGER, INTENT(IN):: pe
934  REAL(dp), DIMENSION(:), INTENT(IN):: c
935
936  write(6,*) 'ERROR in chem_gasphase_mod ',ierr,C(1),PE
937
938
939END SUBROUTINE error_output
940 
941      SUBROUTINE wscal(n, alpha, x, incx)
942!- - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - -
943!     constant times a vector: x(1:N) <- Alpha*x(1:N)
944!     only for incX=incY=1
945!     after BLAS
946!     replace this by the function from the optimized BLAS implementation:
947!         CALL SSCAL(N,Alpha,X,1) or  CALL DSCAL(N,Alpha,X,1)
948!- - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - -
949
950      INTEGER  :: i, incx, m, mp1, n
951      REAL(kind=dp) :: x(n), alpha
952      REAL(kind=dp), PARAMETER  :: zero=0.0_dp, one=1.0_dp
953
954      IF (alpha .eq. one)RETURN
955      IF (n .le. 0)RETURN
956
957      m = mod(n, 5)
958      IF ( m .ne. 0)THEN
959        IF (alpha .eq. (- one))THEN
960          DO i = 1, m
961            x(i) = - x(i)
962          ENDDO
963        ELSEIF (alpha .eq. zero)THEN
964          DO i = 1, m
965            x(i) = zero
966          ENDDO
967        ELSE
968          DO i = 1, m
969            x(i) = alpha* x(i)
970          ENDDO
971        ENDIF
972        IF ( n .lt. 5)RETURN
973      ENDIF
974      mp1 = m + 1
975      IF (alpha .eq. (- one))THEN
976        DO i = mp1, n, 5
977          x(i)   = - x(i)
978          x(i + 1) = - x(i + 1)
979          x(i + 2) = - x(i + 2)
980          x(i + 3) = - x(i + 3)
981          x(i + 4) = - x(i + 4)
982        ENDDO
983      ELSEIF (alpha .eq. zero)THEN
984        DO i = mp1, n, 5
985          x(i)   = zero
986          x(i + 1) = zero
987          x(i + 2) = zero
988          x(i + 3) = zero
989          x(i + 4) = zero
990        ENDDO
991      ELSE
992        DO i = mp1, n, 5
993          x(i)   = alpha* x(i)
994          x(i + 1) = alpha* x(i + 1)
995          x(i + 2) = alpha* x(i + 2)
996          x(i + 3) = alpha* x(i + 3)
997          x(i + 4) = alpha* x(i + 4)
998        ENDDO
999      ENDIF
1000
1001      END SUBROUTINE wscal
1002 
1003      SUBROUTINE waxpy(n, alpha, x, incx, y, incy)
1004!- - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - -
1005!     constant times a vector plus a vector: y <- y + Alpha*x
1006!     only for incX=incY=1
1007!     after BLAS
1008!     replace this by the function from the optimized BLAS implementation:
1009!         CALL SAXPY(N,Alpha,X,1,Y,1) or  CALL DAXPY(N,Alpha,X,1,Y,1)
1010!- - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - -
1011
1012      INTEGER  :: i, incx, incy, m, mp1, n
1013      REAL(kind=dp):: x(n), y(n), alpha
1014      REAL(kind=dp), PARAMETER :: zero = 0.0_dp
1015
1016      IF (alpha .eq. zero)RETURN
1017      IF (n .le. 0)RETURN
1018
1019      m = mod(n, 4)
1020      IF ( m .ne. 0)THEN
1021        DO i = 1, m
1022          y(i) = y(i) + alpha* x(i)
1023        ENDDO
1024        IF ( n .lt. 4)RETURN
1025      ENDIF
1026      mp1 = m + 1
1027      DO i = mp1, n, 4
1028        y(i) = y(i) + alpha* x(i)
1029        y(i + 1) = y(i + 1) + alpha* x(i + 1)
1030        y(i + 2) = y(i + 2) + alpha* x(i + 2)
1031        y(i + 3) = y(i + 3) + alpha* x(i + 3)
1032      ENDDO
1033     
1034      END SUBROUTINE waxpy
1035 
1036SUBROUTINE rosenbrock(n, y, tstart, tend, &
1037           abstol, reltol,             &
1038           rcntrl, icntrl, rstatus, istatus, ierr)
1039!~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
1040!
1041!    Solves the system y'=F(t,y) using a Rosenbrock method defined by:
1042!
1043!     G = 1/(H*gamma(1)) - Jac(t0,Y0)
1044!     T_i = t0 + Alpha(i)*H
1045!     Y_i = Y0 + \sum_{j=1}^{i-1} A(i,j)*K_j
1046!     G *K_i = Fun( T_i,Y_i)+ \sum_{j=1}^S C(i,j)/H *K_j +
1047!         gamma(i)*dF/dT(t0,Y0)
1048!     Y1 = Y0 + \sum_{j=1}^S M(j)*K_j
1049!
1050!    For details on Rosenbrock methods and their implementation consult:
1051!      E. Hairer and G. Wanner
1052!      "Solving ODEs II. Stiff and differential-algebraic problems".
1053!      Springer series in computational mathematics,Springer-Verlag,1996.
1054!    The codes contained in the book inspired this implementation.
1055!
1056!    (C)  Adrian Sandu,August 2004
1057!    Virginia Polytechnic Institute and State University
1058!    Contact: sandu@cs.vt.edu
1059!    Revised by Philipp Miehe and Adrian Sandu,May 2006                 
1060!    This implementation is part of KPP - the Kinetic PreProcessor
1061!~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
1062!
1063!~~~>   input arguments:
1064!
1065!-     y(n)  = vector of initial conditions (at t=tstart)
1066!-    [tstart, tend]  = time range of integration
1067!     (if Tstart>Tend the integration is performed backwards in time)
1068!-    reltol, abstol = user precribed accuracy
1069!- SUBROUTINE  fun( t, y, ydot) = ode FUNCTION,
1070!                       returns Ydot = Y' = F(T,Y)
1071!- SUBROUTINE  jac( t, y, jcb) = jacobian of the ode FUNCTION,
1072!                       returns Jcb = dFun/dY
1073!-    icntrl(1:20)  = INTEGER inputs PARAMETERs
1074!-    rcntrl(1:20)  = REAL inputs PARAMETERs
1075!~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
1076!
1077!~~~>     output arguments:
1078!
1079!-    y(n)  - > vector of final states (at t- >tend)
1080!-    istatus(1:20) - > INTEGER output PARAMETERs
1081!-    rstatus(1:20) - > REAL output PARAMETERs
1082!-    ierr            - > job status upon RETURN
1083!                        success (positive value) or
1084!                        failure (negative value)
1085!~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
1086!
1087!~~~>     input PARAMETERs:
1088!
1089!    Note: For input parameters equal to zero the default values of the
1090!       corresponding variables are used.
1091!
1092!    ICNTRL(1) = 1: F = F(y)   Independent of T (AUTONOMOUS)
1093!              = 0: F = F(t,y) Depends on T (NON-AUTONOMOUS)
1094!
1095!    ICNTRL(2) = 0: AbsTol,RelTol are N-dimensional vectors
1096!              = 1: AbsTol,RelTol are scalars
1097!
1098!    ICNTRL(3)  -> selection of a particular Rosenbrock method
1099!        = 0 :    Rodas3 (default)
1100!        = 1 :    Ros2
1101!        = 2 :    Ros3
1102!        = 3 :    Ros4
1103!        = 4 :    Rodas3
1104!        = 5 :    Rodas4
1105!
1106!    ICNTRL(4)  -> maximum number of integration steps
1107!        For ICNTRL(4) =0) the default value of 100000 is used
1108!
1109!    RCNTRL(1)  -> Hmin,lower bound for the integration step size
1110!          It is strongly recommended to keep Hmin = ZERO
1111!    RCNTRL(2)  -> Hmax,upper bound for the integration step size
1112!    RCNTRL(3)  -> Hstart,starting value for the integration step size
1113!
1114!    RCNTRL(4)  -> FacMin,lower bound on step decrease factor (default=0.2)
1115!    RCNTRL(5)  -> FacMax,upper bound on step increase factor (default=6)
1116!    RCNTRL(6)  -> FacRej,step decrease factor after multiple rejections
1117!                          (default=0.1)
1118!    RCNTRL(7)  -> FacSafe,by which the new step is slightly smaller
1119!         than the predicted value  (default=0.9)
1120!~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
1121!
1122!
1123!    OUTPUT ARGUMENTS:
1124!    -----------------
1125!
1126!    T           -> T value for which the solution has been computed
1127!                     (after successful return T=Tend).
1128!
1129!    Y(N)        -> Numerical solution at T
1130!
1131!    IDID        -> Reports on successfulness upon return:
1132!                    = 1 for success
1133!                    < 0 for error (value equals error code)
1134!
1135!    ISTATUS(1)  -> No. of function calls
1136!    ISTATUS(2)  -> No. of jacobian calls
1137!    ISTATUS(3)  -> No. of steps
1138!    ISTATUS(4)  -> No. of accepted steps
1139!    ISTATUS(5)  -> No. of rejected steps (except at very beginning)
1140!    ISTATUS(6)  -> No. of LU decompositions
1141!    ISTATUS(7)  -> No. of forward/backward substitutions
1142!    ISTATUS(8)  -> No. of singular matrix decompositions
1143!
1144!    RSTATUS(1)  -> Texit,the time corresponding to the
1145!                     computed Y upon return
1146!    RSTATUS(2)  -> Hexit,last accepted step before exit
1147!    RSTATUS(3)  -> Hnew,last predicted step (not yet taken)
1148!                   For multiple restarts,use Hnew as Hstart
1149!                     in the subsequent run
1150!
1151!~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
1152
1153
1154!~~~>  arguments
1155   INTEGER,      INTENT(IN)  :: n
1156   REAL(kind=dp), INTENT(INOUT):: y(n)
1157   REAL(kind=dp), INTENT(IN)  :: tstart, tend
1158   REAL(kind=dp), INTENT(IN)  :: abstol(n), reltol(n)
1159   INTEGER,      INTENT(IN)  :: icntrl(20)
1160   REAL(kind=dp), INTENT(IN)  :: rcntrl(20)
1161   INTEGER,      INTENT(INOUT):: istatus(20)
1162   REAL(kind=dp), INTENT(INOUT):: rstatus(20)
1163   INTEGER, INTENT(OUT) :: ierr
1164!~~~>  PARAMETERs of the rosenbrock method, up to 6 stages
1165   INTEGER ::  ros_s, rosmethod
1166   INTEGER, PARAMETER :: rs2=1, rs3=2, rs4=3, rd3=4, rd4=5, rg3=6
1167   REAL(kind=dp):: ros_a(15), ros_c(15), ros_m(6), ros_e(6), &
1168                    ros_alpha(6), ros_gamma(6), ros_elo
1169   LOGICAL :: ros_newf(6)
1170   CHARACTER(len=12):: ros_name
1171!~~~>  local variables
1172   REAL(kind=dp):: roundoff, facmin, facmax, facrej, facsafe
1173   REAL(kind=dp):: hmin, hmax, hstart
1174   REAL(kind=dp):: texit
1175   INTEGER       :: i, uplimtol, max_no_steps
1176   LOGICAL       :: autonomous, vectortol
1177!~~~>   PARAMETERs
1178   REAL(kind=dp), PARAMETER :: zero = 0.0_dp, one  = 1.0_dp
1179   REAL(kind=dp), PARAMETER :: deltamin = 1.0e-5_dp
1180
1181!~~~>  initialize statistics
1182   istatus(1:8) = 0
1183   rstatus(1:3) = zero
1184
1185!~~~>  autonomous or time dependent ode. default is time dependent.
1186   autonomous = .not.(icntrl(1) == 0)
1187
1188!~~~>  for scalar tolerances (icntrl(2).ne.0) the code uses abstol(1)and reltol(1)
1189!   For Vector tolerances (ICNTRL(2) == 0) the code uses AbsTol(1:N) and RelTol(1:N)
1190   IF (icntrl(2) == 0)THEN
1191      vectortol = .TRUE.
1192      uplimtol  = n
1193   ELSE
1194      vectortol = .FALSE.
1195      uplimtol  = 1
1196   ENDIF
1197
1198!~~~>   initialize the particular rosenbrock method selected
1199   select CASE (icntrl(3))
1200     CASE (1)
1201       CALL ros2
1202     CASE (2)
1203       CALL ros3
1204     CASE (3)
1205       CALL ros4
1206     CASE (0, 4)
1207       CALL rodas3
1208     CASE (5)
1209       CALL rodas4
1210     CASE (6)
1211       CALL rang3
1212     CASE default
1213       PRINT *,'Unknown Rosenbrock method: ICNTRL(3) =',ICNTRL(3) 
1214       CALL ros_errormsg(- 2, tstart, zero, ierr)
1215       RETURN
1216   END select
1217
1218!~~~>   the maximum number of steps admitted
1219   IF (icntrl(4) == 0)THEN
1220      max_no_steps = 200000
1221   ELSEIF (icntrl(4)> 0)THEN
1222      max_no_steps=icntrl(4)
1223   ELSE
1224      PRINT *,'User-selected max no. of steps: ICNTRL(4) =',ICNTRL(4)
1225      CALL ros_errormsg(- 1, tstart, zero, ierr)
1226      RETURN
1227   ENDIF
1228
1229!~~~>  unit roundoff (1+ roundoff>1)
1230   roundoff = epsilon(one)
1231
1232!~~~>  lower bound on the step size: (positive value)
1233   IF (rcntrl(1) == zero)THEN
1234      hmin = zero
1235   ELSEIF (rcntrl(1)> zero)THEN
1236      hmin = rcntrl(1)
1237   ELSE
1238      PRINT *,'User-selected Hmin: RCNTRL(1) =',RCNTRL(1)
1239      CALL ros_errormsg(- 3, tstart, zero, ierr)
1240      RETURN
1241   ENDIF
1242!~~~>  upper bound on the step size: (positive value)
1243   IF (rcntrl(2) == zero)THEN
1244      hmax = abs(tend-tstart)
1245   ELSEIF (rcntrl(2)> zero)THEN
1246      hmax = min(abs(rcntrl(2)), abs(tend-tstart))
1247   ELSE
1248      PRINT *,'User-selected Hmax: RCNTRL(2) =',RCNTRL(2)
1249      CALL ros_errormsg(- 3, tstart, zero, ierr)
1250      RETURN
1251   ENDIF
1252!~~~>  starting step size: (positive value)
1253   IF (rcntrl(3) == zero)THEN
1254      hstart = max(hmin, deltamin)
1255   ELSEIF (rcntrl(3)> zero)THEN
1256      hstart = min(abs(rcntrl(3)), abs(tend-tstart))
1257   ELSE
1258      PRINT *,'User-selected Hstart: RCNTRL(3) =',RCNTRL(3)
1259      CALL ros_errormsg(- 3, tstart, zero, ierr)
1260      RETURN
1261   ENDIF
1262!~~~>  step size can be changed s.t.  facmin < hnew/hold < facmax
1263   IF (rcntrl(4) == zero)THEN
1264      facmin = 0.2_dp
1265   ELSEIF (rcntrl(4)> zero)THEN
1266      facmin = rcntrl(4)
1267   ELSE
1268      PRINT *,'User-selected FacMin: RCNTRL(4) =',RCNTRL(4)
1269      CALL ros_errormsg(- 4, tstart, zero, ierr)
1270      RETURN
1271   ENDIF
1272   IF (rcntrl(5) == zero)THEN
1273      facmax = 6.0_dp
1274   ELSEIF (rcntrl(5)> zero)THEN
1275      facmax = rcntrl(5)
1276   ELSE
1277      PRINT *,'User-selected FacMax: RCNTRL(5) =',RCNTRL(5)
1278      CALL ros_errormsg(- 4, tstart, zero, ierr)
1279      RETURN
1280   ENDIF
1281!~~~>   facrej: factor to decrease step after 2 succesive rejections
1282   IF (rcntrl(6) == zero)THEN
1283      facrej = 0.1_dp
1284   ELSEIF (rcntrl(6)> zero)THEN
1285      facrej = rcntrl(6)
1286   ELSE
1287      PRINT *,'User-selected FacRej: RCNTRL(6) =',RCNTRL(6)
1288      CALL ros_errormsg(- 4, tstart, zero, ierr)
1289      RETURN
1290   ENDIF
1291!~~~>   facsafe: safety factor in the computation of new step size
1292   IF (rcntrl(7) == zero)THEN
1293      facsafe = 0.9_dp
1294   ELSEIF (rcntrl(7)> zero)THEN
1295      facsafe = rcntrl(7)
1296   ELSE
1297      PRINT *,'User-selected FacSafe: RCNTRL(7) =',RCNTRL(7)
1298      CALL ros_errormsg(- 4, tstart, zero, ierr)
1299      RETURN
1300   ENDIF
1301!~~~>  check IF tolerances are reasonable
1302    DO i=1, uplimtol
1303      IF ((abstol(i)<= zero).or. (reltol(i)<= 10.0_dp* roundoff)&
1304         .or. (reltol(i)>= 1.0_dp))THEN
1305        PRINT *,' AbsTol(',i,') = ',AbsTol(i)
1306        PRINT *,' RelTol(',i,') = ',RelTol(i)
1307        CALL ros_errormsg(- 5, tstart, zero, ierr)
1308        RETURN
1309      ENDIF
1310    ENDDO
1311
1312
1313!~~~>  CALL rosenbrock method
1314   CALL ros_integrator(y, tstart, tend, texit,  &
1315        abstol, reltol,                         &
1316!  Integration parameters
1317        autonomous, vectortol, max_no_steps,    &
1318        roundoff, hmin, hmax, hstart,           &
1319        facmin, facmax, facrej, facsafe,        &
1320!  Error indicator
1321        ierr)
1322
1323!~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
1324CONTAINS !  SUBROUTINEs internal to rosenbrock
1325!~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
1326   
1327!~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~   
1328 SUBROUTINE ros_errormsg(code, t, h, ierr)
1329!~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~   
1330!    Handles all error messages
1331!~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~   
1332 
1333   REAL(kind=dp), INTENT(IN):: t, h
1334   INTEGER, INTENT(IN) :: code
1335   INTEGER, INTENT(OUT):: ierr
1336   
1337   ierr = code
1338   print * , &
1339     'Forced exit from Rosenbrock due to the following error:' 
1340     
1341   select CASE (code)
1342    CASE (- 1) 
1343      PRINT *,'--> Improper value for maximal no of steps'
1344    CASE (- 2) 
1345      PRINT *,'--> Selected Rosenbrock method not implemented'
1346    CASE (- 3) 
1347      PRINT *,'--> Hmin/Hmax/Hstart must be positive'
1348    CASE (- 4) 
1349      PRINT *,'--> FacMin/FacMax/FacRej must be positive'
1350    CASE (- 5)
1351      PRINT *,'--> Improper tolerance values'
1352    CASE (- 6)
1353      PRINT *,'--> No of steps exceeds maximum bound'
1354    CASE (- 7)
1355      PRINT *,'--> Step size too small: T + 10*H = T',&
1356            ' or H < Roundoff'
1357    CASE (- 8) 
1358      PRINT *,'--> Matrix is repeatedly singular'
1359    CASE default
1360      PRINT *,'Unknown Error code: ',Code
1361   END select
1362   
1363   print * , "t=", t, "and h=", h
1364     
1365 END SUBROUTINE ros_errormsg
1366
1367!~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
1368 SUBROUTINE ros_integrator (y, tstart, tend, t, &
1369        abstol, reltol,                         &
1370!~~~> integration PARAMETERs
1371        autonomous, vectortol, max_no_steps,    &
1372        roundoff, hmin, hmax, hstart,           &
1373        facmin, facmax, facrej, facsafe,        &
1374!~~~> error indicator
1375        ierr)
1376!~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
1377!   Template for the implementation of a generic Rosenbrock method
1378!      defined by ros_S (no of stages)
1379!      and its coefficients ros_{A,C,M,E,Alpha,Gamma}
1380!~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
1381
1382
1383!~~~> input: the initial condition at tstart; output: the solution at t
1384   REAL(kind=dp), INTENT(INOUT):: y(n)
1385!~~~> input: integration interval
1386   REAL(kind=dp), INTENT(IN):: tstart, tend
1387!~~~> output: time at which the solution is RETURNed (t=tendIF success)
1388   REAL(kind=dp), INTENT(OUT)::  t
1389!~~~> input: tolerances
1390   REAL(kind=dp), INTENT(IN)::  abstol(n), reltol(n)
1391!~~~> input: integration PARAMETERs
1392   LOGICAL, INTENT(IN):: autonomous, vectortol
1393   REAL(kind=dp), INTENT(IN):: hstart, hmin, hmax
1394   INTEGER, INTENT(IN):: max_no_steps
1395   REAL(kind=dp), INTENT(IN):: roundoff, facmin, facmax, facrej, facsafe
1396!~~~> output: error indicator
1397   INTEGER, INTENT(OUT):: ierr
1398! ~~~~ Local variables
1399   REAL(kind=dp):: ynew(n), fcn0(n), fcn(n)
1400   REAL(kind=dp):: k(n* ros_s), dfdt(n)
1401#ifdef full_algebra   
1402   REAL(kind=dp):: jac0(n, n), ghimj(n, n)
1403#else
1404   REAL(kind=dp):: jac0(lu_nonzero), ghimj(lu_nonzero)
1405#endif
1406   REAL(kind=dp):: h, hnew, hc, hg, fac, tau
1407   REAL(kind=dp):: err, yerr(n)
1408   INTEGER :: pivot(n), direction, ioffset, j, istage
1409   LOGICAL :: rejectlasth, rejectmoreh, singular
1410!~~~>  local PARAMETERs
1411   REAL(kind=dp), PARAMETER :: zero = 0.0_dp, one  = 1.0_dp
1412   REAL(kind=dp), PARAMETER :: deltamin = 1.0e-5_dp
1413!~~~>  locally called FUNCTIONs
1414!    REAL(kind=dp) WLAMCH
1415!    EXTERNAL WLAMCH
1416!~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
1417
1418
1419!~~~>  initial preparations
1420   t = tstart
1421   rstatus(nhexit) = zero
1422   h = min( max(abs(hmin), abs(hstart)), abs(hmax))
1423   IF (abs(h)<= 10.0_dp* roundoff)h = deltamin
1424
1425   IF (tend  >=  tstart)THEN
1426     direction = + 1
1427   ELSE
1428     direction = - 1
1429   ENDIF
1430   h = direction* h
1431
1432   rejectlasth=.FALSE.
1433   rejectmoreh=.FALSE.
1434
1435!~~~> time loop begins below
1436
1437timeloop: DO WHILE((direction > 0).and.((t- tend) + roundoff <= zero)&
1438       .or. (direction < 0).and.((tend-t) + roundoff <= zero))
1439
1440   IF (istatus(nstp)> max_no_steps)THEN  ! too many steps
1441      CALL ros_errormsg(- 6, t, h, ierr)
1442      RETURN
1443   ENDIF
1444   IF (((t+ 0.1_dp* h) == t).or.(h <= roundoff))THEN  ! step size too small
1445      CALL ros_errormsg(- 7, t, h, ierr)
1446      RETURN
1447   ENDIF
1448
1449!~~~>  limit h IF necessary to avoid going beyond tend
1450   h = min(h, abs(tend-t))
1451
1452!~~~>   compute the FUNCTION at current time
1453   CALL funtemplate(t, y, fcn0)
1454   istatus(nfun) = istatus(nfun) + 1
1455
1456!~~~>  compute the FUNCTION derivative with respect to t
1457   IF (.not.autonomous)THEN
1458      CALL ros_funtimederivative(t, roundoff, y, &
1459                fcn0, dfdt)
1460   ENDIF
1461
1462!~~~>   compute the jacobian at current time
1463   CALL jactemplate(t, y, jac0)
1464   istatus(njac) = istatus(njac) + 1
1465
1466!~~~>  repeat step calculation until current step accepted
1467untilaccepted: do
1468
1469   CALL ros_preparematrix(h, direction, ros_gamma(1), &
1470          jac0, ghimj, pivot, singular)
1471   IF (singular)THEN ! more than 5 consecutive failed decompositions
1472       CALL ros_errormsg(- 8, t, h, ierr)
1473       RETURN
1474   ENDIF
1475
1476!~~~>   compute the stages
1477stage: DO istage = 1, ros_s
1478
1479      ! current istage offset. current istage vector is k(ioffset+ 1:ioffset+ n)
1480       ioffset = n* (istage-1)
1481
1482      ! for the 1st istage the FUNCTION has been computed previously
1483       IF (istage == 1)THEN
1484         !slim: CALL wcopy(n, fcn0, 1, fcn, 1)
1485       fcn(1:n) = fcn0(1:n)
1486      ! istage>1 and a new FUNCTION evaluation is needed at the current istage
1487       ELSEIF(ros_newf(istage))THEN
1488         !slim: CALL wcopy(n, y, 1, ynew, 1)
1489       ynew(1:n) = y(1:n)
1490         DO j = 1, istage-1
1491           CALL waxpy(n, ros_a((istage-1) * (istage-2) /2+ j), &
1492            k(n* (j- 1) + 1), 1, ynew, 1)
1493         ENDDO
1494         tau = t + ros_alpha(istage) * direction* h
1495         CALL funtemplate(tau, ynew, fcn)
1496         istatus(nfun) = istatus(nfun) + 1
1497       ENDIF ! IF istage == 1 ELSEIF ros_newf(istage)
1498       !slim: CALL wcopy(n, fcn, 1, k(ioffset+ 1), 1)
1499       k(ioffset+ 1:ioffset+ n) = fcn(1:n)
1500       DO j = 1, istage-1
1501         hc = ros_c((istage-1) * (istage-2) /2+ j) /(direction* h)
1502         CALL waxpy(n, hc, k(n* (j- 1) + 1), 1, k(ioffset+ 1), 1)
1503       ENDDO
1504       IF ((.not. autonomous).and.(ros_gamma(istage).ne.zero))THEN
1505         hg = direction* h* ros_gamma(istage)
1506         CALL waxpy(n, hg, dfdt, 1, k(ioffset+ 1), 1)
1507       ENDIF
1508       CALL ros_solve(ghimj, pivot, k(ioffset+ 1))
1509
1510   END DO stage
1511
1512
1513!~~~>  compute the new solution
1514   !slim: CALL wcopy(n, y, 1, ynew, 1)
1515   ynew(1:n) = y(1:n)
1516   DO j=1, ros_s
1517         CALL waxpy(n, ros_m(j), k(n* (j- 1) + 1), 1, ynew, 1)
1518   ENDDO
1519
1520!~~~>  compute the error estimation
1521   !slim: CALL wscal(n, zero, yerr, 1)
1522   yerr(1:n) = zero
1523   DO j=1, ros_s
1524        CALL waxpy(n, ros_e(j), k(n* (j- 1) + 1), 1, yerr, 1)
1525   ENDDO
1526   err = ros_errornorm(y, ynew, yerr, abstol, reltol, vectortol)
1527
1528!~~~> new step size is bounded by facmin <= hnew/h <= facmax
1529   fac  = min(facmax, max(facmin, facsafe/err** (one/ros_elo)))
1530   hnew = h* fac
1531
1532!~~~>  check the error magnitude and adjust step size
1533   istatus(nstp) = istatus(nstp) + 1
1534   IF ((err <= one).or.(h <= hmin))THEN  !~~~> accept step
1535      istatus(nacc) = istatus(nacc) + 1
1536      !slim: CALL wcopy(n, ynew, 1, y, 1)
1537      y(1:n) = ynew(1:n)
1538      t = t + direction* h
1539      hnew = max(hmin, min(hnew, hmax))
1540      IF (rejectlasth)THEN  ! no step size increase after a rejected step
1541         hnew = min(hnew, h)
1542      ENDIF
1543      rstatus(nhexit) = h
1544      rstatus(nhnew) = hnew
1545      rstatus(ntexit) = t
1546      rejectlasth = .FALSE.
1547      rejectmoreh = .FALSE.
1548      h = hnew
1549      exit untilaccepted ! exit the loop: WHILE step not accepted
1550   ELSE           !~~~> reject step
1551      IF (rejectmoreh)THEN
1552         hnew = h* facrej
1553      ENDIF
1554      rejectmoreh = rejectlasth
1555      rejectlasth = .TRUE.
1556      h = hnew
1557      IF (istatus(nacc)>= 1) istatus(nrej) = istatus(nrej) + 1
1558   ENDIF ! err <= 1
1559
1560   END DO untilaccepted
1561
1562   END DO timeloop
1563
1564!~~~> succesful exit
1565   ierr = 1  !~~~> the integration was successful
1566
1567  END SUBROUTINE ros_integrator
1568
1569
1570!~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
1571  REAL(kind=dp)FUNCTION ros_errornorm(y, ynew, yerr, &
1572                               abstol, reltol, vectortol)
1573!~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
1574!~~~> computes the "scaled norm" of the error vector yerr
1575!~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
1576
1577! Input arguments
1578   REAL(kind=dp), INTENT(IN):: y(n), ynew(n), &
1579          yerr(n), abstol(n), reltol(n)
1580   LOGICAL, INTENT(IN)::  vectortol
1581! Local variables
1582   REAL(kind=dp):: err, scale, ymax
1583   INTEGER  :: i
1584   REAL(kind=dp), PARAMETER :: zero = 0.0_dp
1585
1586   err = zero
1587   DO i=1, n
1588     ymax = max(abs(y(i)), abs(ynew(i)))
1589     IF (vectortol)THEN
1590       scale = abstol(i) + reltol(i) * ymax
1591     ELSE
1592       scale = abstol(1) + reltol(1) * ymax
1593     ENDIF
1594     err = err+ (yerr(i) /scale) ** 2
1595   ENDDO
1596   err  = sqrt(err/n)
1597
1598   ros_errornorm = max(err, 1.0d-10)
1599
1600  END FUNCTION ros_errornorm
1601
1602
1603!~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
1604  SUBROUTINE ros_funtimederivative(t, roundoff, y, &
1605                fcn0, dfdt)
1606!~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
1607!~~~> the time partial derivative of the FUNCTION by finite differences
1608!~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
1609
1610!~~~> input arguments
1611   REAL(kind=dp), INTENT(IN):: t, roundoff, y(n), fcn0(n)
1612!~~~> output arguments
1613   REAL(kind=dp), INTENT(OUT):: dfdt(n)
1614!~~~> local variables
1615   REAL(kind=dp):: delta
1616   REAL(kind=dp), PARAMETER :: one = 1.0_dp, deltamin = 1.0e-6_dp
1617
1618   delta = sqrt(roundoff) * max(deltamin, abs(t))
1619   CALL funtemplate(t+ delta, y, dfdt)
1620   istatus(nfun) = istatus(nfun) + 1
1621   CALL waxpy(n, (- one), fcn0, 1, dfdt, 1)
1622   CALL wscal(n, (one/delta), dfdt, 1)
1623
1624  END SUBROUTINE ros_funtimederivative
1625
1626
1627!~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
1628  SUBROUTINE ros_preparematrix(h, direction, gam, &
1629             jac0, ghimj, pivot, singular)
1630! --- --- --- --- --- --- --- --- --- --- --- --- ---
1631!  Prepares the LHS matrix for stage calculations
1632!  1.  Construct Ghimj = 1/(H*ham) - Jac0
1633!      "(Gamma H) Inverse Minus Jacobian"
1634!  2.  Repeat LU decomposition of Ghimj until successful.
1635!       -half the step size if LU decomposition fails and retry
1636!       -exit after 5 consecutive fails
1637! --- --- --- --- --- --- --- --- --- --- --- --- ---
1638
1639!~~~> input arguments
1640#ifdef full_algebra   
1641   REAL(kind=dp), INTENT(IN)::  jac0(n, n)
1642#else
1643   REAL(kind=dp), INTENT(IN)::  jac0(lu_nonzero)
1644#endif   
1645   REAL(kind=dp), INTENT(IN)::  gam
1646   INTEGER, INTENT(IN)::  direction
1647!~~~> output arguments
1648#ifdef full_algebra   
1649   REAL(kind=dp), INTENT(OUT):: ghimj(n, n)
1650#else
1651   REAL(kind=dp), INTENT(OUT):: ghimj(lu_nonzero)
1652#endif   
1653   LOGICAL, INTENT(OUT)::  singular
1654   INTEGER, INTENT(OUT)::  pivot(n)
1655!~~~> inout arguments
1656   REAL(kind=dp), INTENT(INOUT):: h   ! step size is decreased when lu fails
1657!~~~> local variables
1658   INTEGER  :: i, ising, nconsecutive
1659   REAL(kind=dp):: ghinv
1660   REAL(kind=dp), PARAMETER :: one  = 1.0_dp, half = 0.5_dp
1661
1662   nconsecutive = 0
1663   singular = .TRUE.
1664
1665   DO WHILE (singular)
1666
1667!~~~>    construct ghimj = 1/(h* gam) - jac0
1668#ifdef full_algebra   
1669     !slim: CALL wcopy(n* n, jac0, 1, ghimj, 1)
1670     !slim: CALL wscal(n* n, (- one), ghimj, 1)
1671     ghimj = - jac0
1672     ghinv = one/(direction* h* gam)
1673     DO i=1, n
1674       ghimj(i, i) = ghimj(i, i) + ghinv
1675     ENDDO
1676#else
1677     !slim: CALL wcopy(lu_nonzero, jac0, 1, ghimj, 1)
1678     !slim: CALL wscal(lu_nonzero, (- one), ghimj, 1)
1679     ghimj(1:lu_nonzero) = - jac0(1:lu_nonzero)
1680     ghinv = one/(direction* h* gam)
1681     DO i=1, n
1682       ghimj(lu_diag(i)) = ghimj(lu_diag(i)) + ghinv
1683     ENDDO
1684#endif   
1685!~~~>    compute lu decomposition
1686     CALL ros_decomp( ghimj, pivot, ising)
1687     IF (ising == 0)THEN
1688!~~~>    IF successful done
1689        singular = .FALSE.
1690     ELSE ! ising .ne. 0
1691!~~~>    IF unsuccessful half the step size; IF 5 consecutive fails THEN RETURN
1692        istatus(nsng) = istatus(nsng) + 1
1693        nconsecutive = nconsecutive+1
1694        singular = .TRUE.
1695        PRINT*,'Warning: LU Decomposition returned ISING = ',ISING
1696        IF (nconsecutive <= 5)THEN ! less than 5 consecutive failed decompositions
1697           h = h* half
1698        ELSE  ! more than 5 consecutive failed decompositions
1699           RETURN
1700        ENDIF  ! nconsecutive
1701      ENDIF    ! ising
1702
1703   END DO ! WHILE singular
1704
1705  END SUBROUTINE ros_preparematrix
1706
1707
1708!~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
1709  SUBROUTINE ros_decomp( a, pivot, ising)
1710!~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
1711!  Template for the LU decomposition
1712!~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
1713!~~~> inout variables
1714#ifdef full_algebra   
1715   REAL(kind=dp), INTENT(INOUT):: a(n, n)
1716#else   
1717   REAL(kind=dp), INTENT(INOUT):: a(lu_nonzero)
1718#endif
1719!~~~> output variables
1720   INTEGER, INTENT(OUT):: pivot(n), ising
1721
1722#ifdef full_algebra   
1723   CALL  dgetrf( n, n, a, n, pivot, ising)
1724#else   
1725   CALL kppdecomp(a, ising)
1726   pivot(1) = 1
1727#endif
1728   istatus(ndec) = istatus(ndec) + 1
1729
1730  END SUBROUTINE ros_decomp
1731
1732
1733!~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
1734  SUBROUTINE ros_solve( a, pivot, b)
1735!~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
1736!  Template for the forward/backward substitution (using pre-computed LU decomposition)
1737!~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
1738!~~~> input variables
1739#ifdef full_algebra   
1740   REAL(kind=dp), INTENT(IN):: a(n, n)
1741   INTEGER :: ising
1742#else   
1743   REAL(kind=dp), INTENT(IN):: a(lu_nonzero)
1744#endif
1745   INTEGER, INTENT(IN):: pivot(n)
1746!~~~> inout variables
1747   REAL(kind=dp), INTENT(INOUT):: b(n)
1748
1749#ifdef full_algebra   
1750   CALL  DGETRS( 'N',N ,1,A,N,Pivot,b,N,ISING)
1751   IF (info < 0)THEN
1752      print* , "error in dgetrs. ising=", ising
1753   ENDIF 
1754#else   
1755   CALL kppsolve( a, b)
1756#endif
1757
1758   istatus(nsol) = istatus(nsol) + 1
1759
1760  END SUBROUTINE ros_solve
1761
1762
1763
1764!~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
1765  SUBROUTINE ros2
1766!~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
1767! --- AN L-STABLE METHOD,2 stages,order 2
1768!~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
1769
1770   double precision g
1771
1772    g = 1.0_dp + 1.0_dp/sqrt(2.0_dp)
1773    rosmethod = rs2
1774!~~~> name of the method
1775    ros_Name = 'ROS-2'
1776!~~~> number of stages
1777    ros_s = 2
1778
1779!~~~> the coefficient matrices a and c are strictly lower triangular.
1780!   The lower triangular (subdiagonal) elements are stored in row-wise order:
1781!   A(2,1) = ros_A(1),A(3,1) =ros_A(2),A(3,2) =ros_A(3),etc.
1782!   The general mapping formula is:
1783!       A(i,j) = ros_A( (i-1)*(i-2)/2 + j)
1784!       C(i,j) = ros_C( (i-1)*(i-2)/2 + j)
1785
1786    ros_a(1) = (1.0_dp) /g
1787    ros_c(1) = (- 2.0_dp) /g
1788!~~~> does the stage i require a new FUNCTION evaluation (ros_newf(i) =true)
1789!   or does it re-use the function evaluation from stage i-1 (ros_NewF(i) =FALSE)
1790    ros_newf(1) = .TRUE.
1791    ros_newf(2) = .TRUE.
1792!~~~> m_i = coefficients for new step solution
1793    ros_m(1) = (3.0_dp) /(2.0_dp* g)
1794    ros_m(2) = (1.0_dp) /(2.0_dp* g)
1795! E_i = Coefficients for error estimator
1796    ros_e(1) = 1.0_dp/(2.0_dp* g)
1797    ros_e(2) = 1.0_dp/(2.0_dp* g)
1798!~~~> ros_elo = estimator of local order - the minimum between the
1799!    main and the embedded scheme orders plus one
1800    ros_elo = 2.0_dp
1801!~~~> y_stage_i ~ y( t + h* alpha_i)
1802    ros_alpha(1) = 0.0_dp
1803    ros_alpha(2) = 1.0_dp
1804!~~~> gamma_i = \sum_j  gamma_{i, j}
1805    ros_gamma(1) = g
1806    ros_gamma(2) = -g
1807
1808 END SUBROUTINE ros2
1809
1810
1811!~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
1812  SUBROUTINE ros3
1813!~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
1814! --- AN L-STABLE METHOD,3 stages,order 3,2 function evaluations
1815!~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
1816
1817   rosmethod = rs3
1818!~~~> name of the method
1819   ros_Name = 'ROS-3'
1820!~~~> number of stages
1821   ros_s = 3
1822
1823!~~~> the coefficient matrices a and c are strictly lower triangular.
1824!   The lower triangular (subdiagonal) elements are stored in row-wise order:
1825!   A(2,1) = ros_A(1),A(3,1) =ros_A(2),A(3,2) =ros_A(3),etc.
1826!   The general mapping formula is:
1827!       A(i,j) = ros_A( (i-1)*(i-2)/2 + j)
1828!       C(i,j) = ros_C( (i-1)*(i-2)/2 + j)
1829
1830   ros_a(1) = 1.0_dp
1831   ros_a(2) = 1.0_dp
1832   ros_a(3) = 0.0_dp
1833
1834   ros_c(1) = - 0.10156171083877702091975600115545e+01_dp
1835   ros_c(2) =  0.40759956452537699824805835358067e+01_dp
1836   ros_c(3) =  0.92076794298330791242156818474003e+01_dp
1837!~~~> does the stage i require a new FUNCTION evaluation (ros_newf(i) =true)
1838!   or does it re-use the function evaluation from stage i-1 (ros_NewF(i) =FALSE)
1839   ros_newf(1) = .TRUE.
1840   ros_newf(2) = .TRUE.
1841   ros_newf(3) = .FALSE.
1842!~~~> m_i = coefficients for new step solution
1843   ros_m(1) =  0.1e+01_dp
1844   ros_m(2) =  0.61697947043828245592553615689730e+01_dp
1845   ros_m(3) = - 0.42772256543218573326238373806514_dp
1846! E_i = Coefficients for error estimator
1847   ros_e(1) =  0.5_dp
1848   ros_e(2) = - 0.29079558716805469821718236208017e+01_dp
1849   ros_e(3) =  0.22354069897811569627360909276199_dp
1850!~~~> ros_elo = estimator of local order - the minimum between the
1851!    main and the embedded scheme orders plus 1
1852   ros_elo = 3.0_dp
1853!~~~> y_stage_i ~ y( t + h* alpha_i)
1854   ros_alpha(1) = 0.0_dp
1855   ros_alpha(2) = 0.43586652150845899941601945119356_dp
1856   ros_alpha(3) = 0.43586652150845899941601945119356_dp
1857!~~~> gamma_i = \sum_j  gamma_{i, j}
1858   ros_gamma(1) = 0.43586652150845899941601945119356_dp
1859   ros_gamma(2) = 0.24291996454816804366592249683314_dp
1860   ros_gamma(3) = 0.21851380027664058511513169485832e+01_dp
1861
1862  END SUBROUTINE ros3
1863
1864!~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
1865
1866
1867!~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
1868  SUBROUTINE ros4
1869!~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
1870!     L-STABLE ROSENBROCK METHOD OF ORDER 4,WITH 4 STAGES
1871!     L-STABLE EMBEDDED ROSENBROCK METHOD OF ORDER 3
1872!
1873!      E. HAIRER AND G. WANNER,SOLVING ORDINARY DIFFERENTIAL
1874!      EQUATIONS II. STIFF AND DIFFERENTIAL-ALGEBRAIC PROBLEMS.
1875!      SPRINGER SERIES IN COMPUTATIONAL MATHEMATICS,
1876!      SPRINGER-VERLAG (1990)
1877!~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
1878
1879
1880   rosmethod = rs4
1881!~~~> name of the method
1882   ros_Name = 'ROS-4'
1883!~~~> number of stages
1884   ros_s = 4
1885
1886!~~~> the coefficient matrices a and c are strictly lower triangular.
1887!   The lower triangular (subdiagonal) elements are stored in row-wise order:
1888!   A(2,1) = ros_A(1),A(3,1) =ros_A(2),A(3,2) =ros_A(3),etc.
1889!   The general mapping formula is:
1890!       A(i,j) = ros_A( (i-1)*(i-2)/2 + j)
1891!       C(i,j) = ros_C( (i-1)*(i-2)/2 + j)
1892
1893   ros_a(1) = 0.2000000000000000e+01_dp
1894   ros_a(2) = 0.1867943637803922e+01_dp
1895   ros_a(3) = 0.2344449711399156_dp
1896   ros_a(4) = ros_a(2)
1897   ros_a(5) = ros_a(3)
1898   ros_a(6) = 0.0_dp
1899
1900   ros_c(1) = -0.7137615036412310e+01_dp
1901   ros_c(2) = 0.2580708087951457e+01_dp
1902   ros_c(3) = 0.6515950076447975_dp
1903   ros_c(4) = -0.2137148994382534e+01_dp
1904   ros_c(5) = -0.3214669691237626_dp
1905   ros_c(6) = -0.6949742501781779_dp
1906!~~~> does the stage i require a new FUNCTION evaluation (ros_newf(i) =true)
1907!   or does it re-use the function evaluation from stage i-1 (ros_NewF(i) =FALSE)
1908   ros_newf(1) = .TRUE.
1909   ros_newf(2) = .TRUE.
1910   ros_newf(3) = .TRUE.
1911   ros_newf(4) = .FALSE.
1912!~~~> m_i = coefficients for new step solution
1913   ros_m(1) = 0.2255570073418735e+01_dp
1914   ros_m(2) = 0.2870493262186792_dp
1915   ros_m(3) = 0.4353179431840180_dp
1916   ros_m(4) = 0.1093502252409163e+01_dp
1917!~~~> e_i  = coefficients for error estimator
1918   ros_e(1) = -0.2815431932141155_dp
1919   ros_e(2) = -0.7276199124938920e-01_dp
1920   ros_e(3) = -0.1082196201495311_dp
1921   ros_e(4) = -0.1093502252409163e+01_dp
1922!~~~> ros_elo  = estimator of local order - the minimum between the
1923!    main and the embedded scheme orders plus 1
1924   ros_elo  = 4.0_dp
1925!~~~> y_stage_i ~ y( t + h* alpha_i)
1926   ros_alpha(1) = 0.0_dp
1927   ros_alpha(2) = 0.1145640000000000e+01_dp
1928   ros_alpha(3) = 0.6552168638155900_dp
1929   ros_alpha(4) = ros_alpha(3)
1930!~~~> gamma_i = \sum_j  gamma_{i, j}
1931   ros_gamma(1) = 0.5728200000000000_dp
1932   ros_gamma(2) = -0.1769193891319233e+01_dp
1933   ros_gamma(3) = 0.7592633437920482_dp
1934   ros_gamma(4) = -0.1049021087100450_dp
1935
1936  END SUBROUTINE ros4
1937
1938!~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
1939  SUBROUTINE rodas3
1940!~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
1941! --- A STIFFLY-STABLE METHOD,4 stages,order 3
1942!~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
1943
1944
1945   rosmethod = rd3
1946!~~~> name of the method
1947   ros_Name = 'RODAS-3'
1948!~~~> number of stages
1949   ros_s = 4
1950
1951!~~~> the coefficient matrices a and c are strictly lower triangular.
1952!   The lower triangular (subdiagonal) elements are stored in row-wise order:
1953!   A(2,1) = ros_A(1),A(3,1) =ros_A(2),A(3,2) =ros_A(3),etc.
1954!   The general mapping formula is:
1955!       A(i,j) = ros_A( (i-1)*(i-2)/2 + j)
1956!       C(i,j) = ros_C( (i-1)*(i-2)/2 + j)
1957
1958   ros_a(1) = 0.0_dp
1959   ros_a(2) = 2.0_dp
1960   ros_a(3) = 0.0_dp
1961   ros_a(4) = 2.0_dp
1962   ros_a(5) = 0.0_dp
1963   ros_a(6) = 1.0_dp
1964
1965   ros_c(1) = 4.0_dp
1966   ros_c(2) = 1.0_dp
1967   ros_c(3) = -1.0_dp
1968   ros_c(4) = 1.0_dp
1969   ros_c(5) = -1.0_dp
1970   ros_c(6) = -(8.0_dp/3.0_dp)
1971
1972!~~~> does the stage i require a new FUNCTION evaluation (ros_newf(i) =true)
1973!   or does it re-use the function evaluation from stage i-1 (ros_NewF(i) =FALSE)
1974   ros_newf(1) = .TRUE.
1975   ros_newf(2) = .FALSE.
1976   ros_newf(3) = .TRUE.
1977   ros_newf(4) = .TRUE.
1978!~~~> m_i = coefficients for new step solution
1979   ros_m(1) = 2.0_dp
1980   ros_m(2) = 0.0_dp
1981   ros_m(3) = 1.0_dp
1982   ros_m(4) = 1.0_dp
1983!~~~> e_i  = coefficients for error estimator
1984   ros_e(1) = 0.0_dp
1985   ros_e(2) = 0.0_dp
1986   ros_e(3) = 0.0_dp
1987   ros_e(4) = 1.0_dp
1988!~~~> ros_elo  = estimator of local order - the minimum between the
1989!    main and the embedded scheme orders plus 1
1990   ros_elo  = 3.0_dp
1991!~~~> y_stage_i ~ y( t + h* alpha_i)
1992   ros_alpha(1) = 0.0_dp
1993   ros_alpha(2) = 0.0_dp
1994   ros_alpha(3) = 1.0_dp
1995   ros_alpha(4) = 1.0_dp
1996!~~~> gamma_i = \sum_j  gamma_{i, j}
1997   ros_gamma(1) = 0.5_dp
1998   ros_gamma(2) = 1.5_dp
1999   ros_gamma(3) = 0.0_dp
2000   ros_gamma(4) = 0.0_dp
2001
2002  END SUBROUTINE rodas3
2003
2004!~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
2005  SUBROUTINE rodas4
2006!~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
2007!     STIFFLY-STABLE ROSENBROCK METHOD OF ORDER 4,WITH 6 STAGES
2008!
2009!      E. HAIRER AND G. WANNER,SOLVING ORDINARY DIFFERENTIAL
2010!      EQUATIONS II. STIFF AND DIFFERENTIAL-ALGEBRAIC PROBLEMS.
2011!      SPRINGER SERIES IN COMPUTATIONAL MATHEMATICS,
2012!      SPRINGER-VERLAG (1996)
2013!~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
2014
2015
2016    rosmethod = rd4
2017!~~~> name of the method
2018    ros_Name = 'RODAS-4'
2019!~~~> number of stages
2020    ros_s = 6
2021
2022!~~~> y_stage_i ~ y( t + h* alpha_i)
2023    ros_alpha(1) = 0.000_dp
2024    ros_alpha(2) = 0.386_dp
2025    ros_alpha(3) = 0.210_dp
2026    ros_alpha(4) = 0.630_dp
2027    ros_alpha(5) = 1.000_dp
2028    ros_alpha(6) = 1.000_dp
2029
2030!~~~> gamma_i = \sum_j  gamma_{i, j}
2031    ros_gamma(1) = 0.2500000000000000_dp
2032    ros_gamma(2) = -0.1043000000000000_dp
2033    ros_gamma(3) = 0.1035000000000000_dp
2034    ros_gamma(4) = -0.3620000000000023e-01_dp
2035    ros_gamma(5) = 0.0_dp
2036    ros_gamma(6) = 0.0_dp
2037
2038!~~~> the coefficient matrices a and c are strictly lower triangular.
2039!   The lower triangular (subdiagonal) elements are stored in row-wise order:
2040!   A(2,1) = ros_A(1),A(3,1) =ros_A(2),A(3,2) =ros_A(3),etc.
2041!   The general mapping formula is:  A(i,j) = ros_A( (i-1)*(i-2)/2 + j)
2042!                  C(i,j) = ros_C( (i-1)*(i-2)/2 + j)
2043
2044    ros_a(1) = 0.1544000000000000e+01_dp
2045    ros_a(2) = 0.9466785280815826_dp
2046    ros_a(3) = 0.2557011698983284_dp
2047    ros_a(4) = 0.3314825187068521e+01_dp
2048    ros_a(5) = 0.2896124015972201e+01_dp
2049    ros_a(6) = 0.9986419139977817_dp
2050    ros_a(7) = 0.1221224509226641e+01_dp
2051    ros_a(8) = 0.6019134481288629e+01_dp
2052    ros_a(9) = 0.1253708332932087e+02_dp
2053    ros_a(10) = -0.6878860361058950_dp
2054    ros_a(11) = ros_a(7)
2055    ros_a(12) = ros_a(8)
2056    ros_a(13) = ros_a(9)
2057    ros_a(14) = ros_a(10)
2058    ros_a(15) = 1.0_dp
2059
2060    ros_c(1) = -0.5668800000000000e+01_dp
2061    ros_c(2) = -0.2430093356833875e+01_dp
2062    ros_c(3) = -0.2063599157091915_dp
2063    ros_c(4) = -0.1073529058151375_dp
2064    ros_c(5) = -0.9594562251023355e+01_dp
2065    ros_c(6) = -0.2047028614809616e+02_dp
2066    ros_c(7) = 0.7496443313967647e+01_dp
2067    ros_c(8) = -0.1024680431464352e+02_dp
2068    ros_c(9) = -0.3399990352819905e+02_dp
2069    ros_c(10) = 0.1170890893206160e+02_dp
2070    ros_c(11) = 0.8083246795921522e+01_dp
2071    ros_c(12) = -0.7981132988064893e+01_dp
2072    ros_c(13) = -0.3152159432874371e+02_dp
2073    ros_c(14) = 0.1631930543123136e+02_dp
2074    ros_c(15) = -0.6058818238834054e+01_dp
2075
2076!~~~> m_i = coefficients for new step solution
2077    ros_m(1) = ros_a(7)
2078    ros_m(2) = ros_a(8)
2079    ros_m(3) = ros_a(9)
2080    ros_m(4) = ros_a(10)
2081    ros_m(5) = 1.0_dp
2082    ros_m(6) = 1.0_dp
2083
2084!~~~> e_i  = coefficients for error estimator
2085    ros_e(1) = 0.0_dp
2086    ros_e(2) = 0.0_dp
2087    ros_e(3) = 0.0_dp
2088    ros_e(4) = 0.0_dp
2089    ros_e(5) = 0.0_dp
2090    ros_e(6) = 1.0_dp
2091
2092!~~~> does the stage i require a new FUNCTION evaluation (ros_newf(i) =true)
2093!   or does it re-use the function evaluation from stage i-1 (ros_NewF(i) =FALSE)
2094    ros_newf(1) = .TRUE.
2095    ros_newf(2) = .TRUE.
2096    ros_newf(3) = .TRUE.
2097    ros_newf(4) = .TRUE.
2098    ros_newf(5) = .TRUE.
2099    ros_newf(6) = .TRUE.
2100
2101!~~~> ros_elo  = estimator of local order - the minimum between the
2102!        main and the embedded scheme orders plus 1
2103    ros_elo = 4.0_dp
2104
2105  END SUBROUTINE rodas4
2106!~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
2107  SUBROUTINE rang3
2108!~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
2109! STIFFLY-STABLE W METHOD OF ORDER 3,WITH 4 STAGES
2110!
2111! J. RANG and L. ANGERMANN
2112! NEW ROSENBROCK W-METHODS OF ORDER 3
2113! FOR PARTIAL DIFFERENTIAL ALGEBRAIC
2114!        EQUATIONS OF INDEX 1                                             
2115! BIT Numerical Mathematics (2005) 45: 761-787
2116!  DOI: 10.1007/s10543-005-0035-y
2117! Table 4.1-4.2
2118!~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
2119
2120
2121    rosmethod = rg3
2122!~~~> name of the method
2123    ros_Name = 'RANG-3'
2124!~~~> number of stages
2125    ros_s = 4
2126
2127    ros_a(1) = 5.09052051067020d+00;
2128    ros_a(2) = 5.09052051067020d+00;
2129    ros_a(3) = 0.0d0;
2130    ros_a(4) = 4.97628111010787d+00;
2131    ros_a(5) = 2.77268164715849d-02;
2132    ros_a(6) = 2.29428036027904d-01;
2133
2134    ros_c(1) = - 1.16790812312283d+01;
2135    ros_c(2) = - 1.64057326467367d+01;
2136    ros_c(3) = - 2.77268164715850d-01;
2137    ros_c(4) = - 8.38103960500476d+00;
2138    ros_c(5) = - 8.48328409199343d-01;
2139    ros_c(6) =  2.87009860433106d-01;
2140
2141    ros_m(1) =  5.22582761233094d+00;
2142    ros_m(2) = - 5.56971148154165d-01;
2143    ros_m(3) =  3.57979469353645d-01;
2144    ros_m(4) =  1.72337398521064d+00;
2145
2146    ros_e(1) = - 5.16845212784040d+00;
2147    ros_e(2) = - 1.26351942603842d+00;
2148    ros_e(3) = - 1.11022302462516d-16;
2149    ros_e(4) =  2.22044604925031d-16;
2150
2151    ros_alpha(1) = 0.0d00;
2152    ros_alpha(2) = 2.21878746765329d+00;
2153    ros_alpha(3) = 2.21878746765329d+00;
2154    ros_alpha(4) = 1.55392337535788d+00;
2155
2156    ros_gamma(1) =  4.35866521508459d-01;
2157    ros_gamma(2) = - 1.78292094614483d+00;
2158    ros_gamma(3) = - 2.46541900496934d+00;
2159    ros_gamma(4) = - 8.05529997906370d-01;
2160
2161
2162!~~~> does the stage i require a new FUNCTION evaluation (ros_newf(i) =true)
2163!   or does it re-use the function evaluation from stage i-1 (ros_NewF(i) =FALSE)
2164    ros_newf(1) = .TRUE.
2165    ros_newf(2) = .TRUE.
2166    ros_newf(3) = .TRUE.
2167    ros_newf(4) = .TRUE.
2168
2169!~~~> ros_elo  = estimator of local order - the minimum between the
2170!        main and the embedded scheme orders plus 1
2171    ros_elo = 3.0_dp
2172
2173  END SUBROUTINE rang3
2174!~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
2175
2176!~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
2177!   End of the set of internal Rosenbrock subroutines
2178!~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
2179END SUBROUTINE rosenbrock
2180 
2181SUBROUTINE funtemplate( t, y, ydot)
2182!~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
2183!  Template for the ODE function call.
2184!  Updates the rate coefficients (and possibly the fixed species) at each call
2185!~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
2186!~~~> input variables
2187   REAL(kind=dp):: t, y(nvar)
2188!~~~> output variables
2189   REAL(kind=dp):: ydot(nvar)
2190!~~~> local variables
2191   REAL(kind=dp):: told
2192
2193   told = time
2194   time = t
2195   CALL fun( y, fix, rconst, ydot)
2196   time = told
2197
2198END SUBROUTINE funtemplate
2199 
2200SUBROUTINE jactemplate( t, y, jcb)
2201!~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
2202!  Template for the ODE Jacobian call.
2203!  Updates the rate coefficients (and possibly the fixed species) at each call
2204!~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
2205!~~~> input variables
2206    REAL(kind=dp):: t, y(nvar)
2207!~~~> output variables
2208#ifdef full_algebra   
2209    REAL(kind=dp):: jv(lu_nonzero), jcb(nvar, nvar)
2210#else
2211    REAL(kind=dp):: jcb(lu_nonzero)
2212#endif   
2213!~~~> local variables
2214    REAL(kind=dp):: told
2215#ifdef full_algebra   
2216    INTEGER :: i, j
2217#endif   
2218
2219    told = time
2220    time = t
2221#ifdef full_algebra   
2222    CALL jac_sp(y, fix, rconst, jv)
2223    DO j=1, nvar
2224      DO i=1, nvar
2225         jcb(i, j) = 0.0_dp
2226      ENDDO
2227    ENDDO
2228    DO i=1, lu_nonzero
2229       jcb(lu_irow(i), lu_icol(i)) = jv(i)
2230    ENDDO
2231#else
2232    CALL jac_sp( y, fix, rconst, jcb)
2233#endif   
2234    time = told
2235
2236END SUBROUTINE jactemplate
2237 
2238  SUBROUTINE kppdecomp( jvs, ier)                                   
2239  ! ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
2240  !        sparse lu factorization                                   
2241  ! ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
2242  ! loop expansion generated by kp4                                   
2243                                                                     
2244    INTEGER  :: ier                                                   
2245    REAL(kind=dp):: jvs(lu_nonzero), a                         
2246                                                                     
2247    a = 0.                                                           
2248    ier = 0                                                           
2249                                                                     
2250!   i = 1
2251!   i = 2
2252!   i = 3
2253!   i = 4
2254!   i = 5
2255    RETURN                                                           
2256                                                                     
2257  END SUBROUTINE kppdecomp                                           
2258 
2259SUBROUTINE get_mechanismname                                       
2260                                                                   
2261  IMPLICIT NONE                                                     
2262
2263! Set cs_mech for check with mechanism name from namelist
2264    cs_mech = 'salsagas'
2265                                                                   
2266  RETURN                                                           
2267END SUBROUTINE get_mechanismname                                   
2268                                                                   
2269 
2270SUBROUTINE chem_gasphase_integrate (time_step_len, conc, tempi, qvapi, fakti, photo, ierrf, xnacc, xnrej, istatus, l_debug, pe, &
2271                     icntrl_i, rcntrl_i) 
2272                                                                   
2273  IMPLICIT NONE                                                     
2274                                                                   
2275  REAL(dp), INTENT(IN)                  :: time_step_len           
2276  REAL(dp), DIMENSION(:, :), INTENT(INOUT) :: conc                   
2277  REAL(dp), DIMENSION(:, :), INTENT(IN)   :: photo                   
2278  REAL(dp), DIMENSION(:), INTENT(IN)     :: tempi                   
2279  REAL(dp), DIMENSION(:), INTENT(IN)     :: qvapi                   
2280  REAL(dp), DIMENSION(:), INTENT(IN)     :: fakti                   
2281  INTEGER, INTENT(OUT), OPTIONAL        :: ierrf(:)               
2282  INTEGER, INTENT(OUT), OPTIONAL        :: xnacc(:)               
2283  INTEGER, INTENT(OUT), OPTIONAL        :: xnrej(:)               
2284  INTEGER, INTENT(INOUT), OPTIONAL      :: istatus(:)             
2285  INTEGER, INTENT(IN), OPTIONAL         :: pe                     
2286  LOGICAL, INTENT(IN), OPTIONAL         :: l_debug                 
2287  INTEGER, DIMENSION(nkppctrl), INTENT(IN), OPTIONAL  :: icntrl_i         
2288  REAL(dp), DIMENSION(nkppctrl), INTENT(IN), OPTIONAL  :: rcntrl_i         
2289                                                                   
2290  INTEGER                                 :: k   ! loop variable     
2291  REAL(dp)                               :: dt                     
2292  INTEGER, DIMENSION(20)                :: istatus_u               
2293  INTEGER                                :: ierr_u                 
2294  INTEGER                                :: vl_dim_lo               
2295                                                                   
2296                                                                   
2297  IF (PRESENT (istatus)) istatus = 0                             
2298  IF (PRESENT (icntrl_i)) icntrl  = icntrl_i                     
2299  IF (PRESENT (rcntrl_i)) rcntrl  = rcntrl_i                     
2300                                                                   
2301  vl_glo = size(tempi, 1)                                           
2302                                                                   
2303  vl_dim_lo = vl_dim                                               
2304  DO k=1, vl_glo, vl_dim_lo                                           
2305    is = k                                                         
2306    ie = min(k+ vl_dim_lo-1, vl_glo)                                 
2307    vl = ie-is+ 1                                                   
2308                                                                   
2309    c(:) = conc(is, :)                                           
2310                                                                   
2311    temp = tempi(is)                                             
2312                                                                   
2313    qvap = qvapi(is)                                             
2314                                                                   
2315    fakt = fakti(is)                                             
2316                                                                   
2317    CALL initialize                                                 
2318                                                                   
2319    phot(:) = photo(is, :)                                           
2320                                                                   
2321    CALL update_rconst                                             
2322                                                                   
2323    dt = time_step_len                                             
2324                                                                   
2325    ! integrate from t=0 to t=dt                                   
2326    CALL integrate(0._dp, dt, icntrl, rcntrl, istatus_u = istatus_u, ierr_u=ierr_u)
2327                                                                   
2328                                                                   
2329   IF (PRESENT(l_debug) .AND. PRESENT(pe)) THEN                       
2330      IF (l_debug) CALL error_output(conc(is, :), ierr_u, pe)           
2331   ENDIF                                                             
2332                                                                     
2333    conc(is, :) = c(:)                                               
2334                                                                   
2335    ! RETURN diagnostic information                                 
2336                                                                   
2337    IF (PRESENT(ierrf))   ierrf(is) = ierr_u                     
2338    IF (PRESENT(xnacc))   xnacc(is) = istatus_u(4)               
2339    IF (PRESENT(xnrej))   xnrej(is) = istatus_u(5)               
2340                                                                   
2341    IF (PRESENT (istatus)) THEN                                   
2342      istatus(1:8) = istatus(1:8) + istatus_u(1:8)               
2343    ENDIF                                                         
2344                                                                   
2345  END DO                                                           
2346 
2347                                                                   
2348! Deallocate input arrays                                           
2349                                                                   
2350                                                                   
2351  data_loaded = .FALSE.                                             
2352                                                                   
2353  RETURN                                                           
2354END SUBROUTINE chem_gasphase_integrate                             
2355
2356END MODULE chem_gasphase_mod
2357 
Note: See TracBrowser for help on using the repository browser.