3 SUBROUTINE fc2k_fillcoreprof (COREPROF_DB, COREPROF_GRID, COREFAST_IN, COREPROF_OUT, INTERPOL)
17 TYPE (type_coreprof
),
POINTER :: coreprof_grid(:)
18 TYPE (type_coreprof
),
POINTER :: coreprof_out(:)
19 TYPE (type_coreprof
),
POINTER :: coreprof_db(:)
20 TYPE (type_corefast
),
POINTER :: corefast_in(:)
23 CALL
fillcoreprof(coreprof_db, coreprof_grid, corefast_in, coreprof_out, interpol)
35 SUBROUTINE fc2k_fillcoreprof2 (COREPROF_DB, COREPROF_GRID, COREFAST_IN, COREPROF_OUT, INTERPOL, integer_params, real_params,&
36 output_flag,diagnostic_info)
50 integer,
dimension(1) :: integer_params
51 real(8),
dimension(2) :: real_params
53 integer,
intent(out) :: output_flag
54 character(len=:),
pointer,
intent(out) :: diagnostic_info
55 character(len=1024) :: internal_diagnostic_info =
''
58 TYPE (type_coreprof
),
POINTER :: coreprof_grid(:)
59 TYPE (type_coreprof
),
POINTER :: coreprof_out(:)
60 TYPE (type_coreprof
),
POINTER :: coreprof_db(:)
61 TYPE (type_corefast
),
POINTER :: corefast_in(:)
63 nullify( diagnostic_info )
64 internal_diagnostic_info =
''
66 CALL
fillcoreprof2(coreprof_db, coreprof_grid, corefast_in, coreprof_out, interpol,integer_params,real_params,&
67 output_flag,internal_diagnostic_info)
70 lenstring = len(trim(adjustl(internal_diagnostic_info)))
71 IF (lenstring > 0)
THEN
72 ALLOCATE (
CHARACTER(LEN=LENSTRING) :: diagnostic_info)
73 diagnostic_info = trim(adjustl(internal_diagnostic_info))
101 TYPE (type_coretransp
),
POINTER :: coretransp_grid(:)
102 TYPE (type_coretransp
),
POINTER :: coretransp_out(:)
103 TYPE (type_coretransp
),
POINTER :: coretransp_db(:)
106 CALL
fillcoretransp(coretransp_db, coretransp_grid, coretransp_out, interpol)
137 TYPE (type_coresource
),
POINTER :: coresource_grid(:)
138 TYPE (type_coresource
),
POINTER :: coresource_out(:)
139 TYPE (type_coresource
),
POINTER :: coresource_db(:)
142 CALL
fillcoresource(coresource_db, coresource_grid, coresource_out, interpol)
173 TYPE (type_coreimpur
),
POINTER :: coreimpur_grid(:)
174 TYPE (type_coreimpur
),
POINTER :: coreimpur_out(:)
175 TYPE (type_coreimpur
),
POINTER :: coreimpur_db(:)
178 CALL
fillcoreimpur(coreimpur_db, coreimpur_grid, coreimpur_out, interpol)
202 TYPE (type_corefast
),
POINTER :: corefast_grid(:)
203 TYPE (type_corefast
),
POINTER :: corefast_out(:)
204 TYPE (type_corefast
),
POINTER :: corefast_db(:)
207 CALL
fillcorefast(corefast_db, corefast_grid, corefast_out, interpol)
237 TYPE (type_equilibrium
),
POINTER :: equilibrium_grid(:)
238 TYPE (type_equilibrium
),
POINTER :: equilibrium_out(:)
239 TYPE (type_equilibrium
),
POINTER :: equilibrium_db(:)
242 CALL
fillequilibrium(equilibrium_db, equilibrium_grid, equilibrium_out, interpol)
271 TYPE (type_toroidfield
),
POINTER :: toroidfield_out(:)
272 TYPE (type_toroidfield
),
POINTER :: toroidfield(:)
273 TYPE (type_toroidfield
),
POINTER :: toroidfield_grid(:)
305 TYPE (type_coreneutrals
),
POINTER :: coreneutrals_grid(:)
306 TYPE (type_coreneutrals
),
POINTER :: coreneutrals_out(:)
307 TYPE (type_coreneutrals
),
POINTER :: coreneutrals_db(:)
310 CALL
fillcoreneutrals(coreneutrals_db, coreneutrals_grid, coreneutrals_out, interpol)
336 TYPE (type_neoclassic
),
POINTER :: neoclassic_grid(:)
337 TYPE (type_neoclassic
),
POINTER :: neoclassic_out(:)
338 TYPE (type_neoclassic
),
POINTER :: neoclassic_db(:)
341 CALL
fillneoclassic(neoclassic_db, neoclassic_grid, neoclassic_out, interpol)
subroutine fc2k_fillcoreprof(COREPROF_DB, COREPROF_GRID, COREFAST_IN, COREPROF_OUT, INTERPOL)
subroutine fc2k_fillcoresource(CORESOURCE_DB, CORESOURCE_GRID, CORESOURCE_OUT, INTERPOL)
subroutine fc2k_fillequilibrium(EQUILIBRIUM_DB, EQUILIBRIUM_GRID, EQUILIBRIUM_OUT, INTERPOL)
subroutine fillcoreimpur(COREIMPUR_DB, COREIMPUR_GRID, COREIMPUR_OUT, INTERPOL)
subroutine fillcorefast(COREFAST_DB, COREFAST_GRID, COREFAST_OUT, INTERPOL)
subroutine filltoroidfield(TOROIDFIELD, TOROIDFIELD_GRID, TOROIDFIELD_OUT)
subroutine fillcoresource(CORESOURCE_DB, CORESOURCE_GRID, CORESOURCE_OUT, INTERPOL)
subroutine fc2k_filltoroidfield(TOROIDFIELD, TOROIDFIELD_GRID, TOROIDFIELD_OUT)
subroutine fillcoreprof(COREPROF_DB, COREPROF_GRID, COREFAST_IN, COREPROF_OUT, INTERPOL)
subroutine fc2k_fillcorefast(COREFAST_DB, COREFAST_GRID, COREFAST_OUT, INTERPOL)
subroutine fillcoreneutrals(CORENEUTRALS_DB, CORENEUTRALS_GRID, CORENEUTRALS_OUT, INTERPOL)
subroutine fc2k_fillcoreneutrals(CORENEUTRALS_DB, CORENEUTRALS_GRID, CORENEUTRALS_OUT, INTERPOL)
subroutine fillcoretransp(CORETRANSP_DB, CORETRANSP_GRID, CORETRANSP_OUT, INTERPOL)
subroutine fc2k_fillcoreimpur(COREIMPUR_DB, COREIMPUR_GRID, COREIMPUR_OUT, INTERPOL)
subroutine fillequilibrium(EQUILIBRIUM_DB, EQUILIBRIUM_GRID, EQUILIBRIUM_OUT, INTERPOL)
subroutine fc2k_fillcoretransp(CORETRANSP_DB, CORETRANSP_GRID, CORETRANSP_OUT, INTERPOL)
subroutine fillcoreprof2(COREPROF_DB, COREPROF_GRID, COREFAST_IN, COREPROF_OUT, INTERPOL, integer_params, real_params, output_flag, diagnostic_info)
subroutine fc2k_fillneoclassic(NEOCLASSIC_DB, NEOCLASSIC_GRID, NEOCLASSIC_OUT, INTERPOL)
subroutine fc2k_fillcoreprof2(COREPROF_DB, COREPROF_GRID, COREFAST_IN, COREPROF_OUT, INTERPOL, integer_params, real_params, output_flag, diagnostic_info)
subroutine fillneoclassic(NEOCLASSIC_DB, NEOCLASSIC_GRID, NEOCLASSIC_OUT, INTERPOL)