ETS  \$Id: Doxyfile 2162 2020-02-26 14:16:09Z g2dpc $
 All Classes Files Functions Variables Pages
fc2k_workaround_ets_2.f90
Go to the documentation of this file.
1 ! + + + + + + + + + + + + + + + + + + + + + + + + + + + +
19 ! + + + + + + + + + + + + + + + + + + + + + + + + + + + +
20 !-------------------------------------------------------!
21 ! This routine provides a wrapper for the !
22 ! FC2K actor generator to call the actual !
23 ! transport solver routine. !
24 !-------------------------------------------------------!
25 ! Source: --- !
26 ! Developers: D.Kalupin !
27 ! Kontacts: Denis.Kalupin@euro-fusion.org !
28 ! !
29 ! Comments: --- !
30 ! !
31 !-------------------------------------------------------!
32 ! + + + + + + + + + + + + + + + + + + + + + + + + + + + +
33 ! + + + + + + + + + + + + + + + + + + + + + + + + + + + +
35  (coreprof_old, coreprof_iter, coreprof_new, &
36  equilibrium_old, equilibrium_iter, &
37  coretransp_iter, &
38  coresource_iter, &
39  coreimpur_iter, &
40  corefast_iter, &
41  control_integer, control_double, &
42 ! CONTROL_INTEGER, CONTROL_DOUBLE, HYPER_DIFF) !AF 25.Apr.2016, 22.Aug.2016
43  hyper_diff, ifail , &
44  code_parameters)
45 
46  USE itm_types
47  USE euitm_schemas
48  USE ets_plasma
49  USE ets
50 ! module needed when moving to TRANSPORT_SOLVER
51 ! USE TRANSPORT_SOLVER
52 ! USE ISO_C_BINDING
53 
54  IMPLICIT NONE
55 
56  TYPE (type_coreprof), POINTER :: coreprof_old(:)
57  TYPE (type_coreprof), POINTER :: coreprof_iter(:)
58  TYPE (type_coreprof), POINTER :: coreprof_new(:)
59  TYPE (type_equilibrium), POINTER :: equilibrium_old(:)
60  TYPE (type_equilibrium), POINTER :: equilibrium_iter(:)
61  TYPE (type_coretransp), POINTER :: coretransp_iter(:)
62  TYPE (type_coresource), POINTER :: coresource_iter(:)
63  TYPE (type_coreimpur), POINTER :: coreimpur_iter(:)
64  TYPE (type_corefast), POINTER :: corefast_iter(:)
65 
66  TYPE (type_param) :: code_parameters
67 
68  TYPE (diagnostic) :: diag
69 
70  INTEGER, INTENT(IN) :: control_integer(4) !integer control parameters
71  REAL (R8), INTENT(IN) :: control_double(6) !real control parameters
72 
73 ! +++ Stabilization scheme !AF 25.Apr.2016, 22.Aug.2016
74  REAL (R8), DIMENSION(2) :: hyper_diff !hyper diffusivity
75 
76  integer :: ifail
77 !initial ifail value
78  ifail=0
79  diag%ierr=0
80 
81 ! Call the actual code:
83 ! OLD: ITER: NEW:
84 ! Previous Previous output
85 ! time step iteration
86  (coreprof_old, coreprof_iter, coreprof_new, & !1-D profiles of plasma parameters
87  equilibrium_old, equilibrium_iter, & !Equilibrium quantities / geometry
88  coretransp_iter, & !transport coefficients
89  coresource_iter, & !sources
90  coreimpur_iter, & !impurity species
91  corefast_iter, & !non-thermal components
92 !
93  control_integer, control_double, & !control switches
94 ! CONTROL_INTEGER, CONTROL_DOUBLE, HYPER_DIFF, ifail, & !AF 25.Apr.2016, 22.Aug.2016
95  hyper_diff, & !AF 25.Apr.2016, 22.Aug.2016
96 ! code_parameters)
97  diag) !run diagnostic (errors)
98  if (diag%ierr.lt.0) then
99  ifail=diag%ierr
100  end if
101  RETURN
102 
103 END SUBROUTINE fc2k_transport_solver_2
104 ! + + + + + + + + + + + + + + + + + + + + + + + + + + + +
105 ! + + + + + + + + + + + + + + + + + + + + + + + + + + + +
106 
subroutine transport_solver_interface
Definition: ets.F90:378
subroutine fc2k_transport_solver_2(COREPROF_OLD,COREPROF_ITER,COREPROF_NEW,EQUILIBRIUM_OLD,EQUILIBRIUM_ITER,CORETRANSP_ITER,CORESOURCE_ITER,COREIMPUR_ITER,COREFAST_ITER,CONTROL_INTEGER,CONTROL_DOUBLE,
Module to cope with problems in fc2k.
Module provides the interface between (external) CPO and internal ETS derived types.
Definition: ets.F90:8
The module declares types of variables used in ETS (transport code)
Definition: ets_plasma.f90:8