ETS  \$Id: Doxyfile 2162 2020-02-26 14:16:09Z g2dpc $
 All Classes Files Functions Variables Pages
joiner.f90
Go to the documentation of this file.
1 ! + + + + + + + + + + + + + + + + + + + + + + + + + + + +
7 ! + + + + + + + + + + + + + + + + + + + + + + + + + + + +
8 
9 MODULE joiner
10 
11  IMPLICIT NONE
12 
13 CONTAINS
14 
15 
16 
17 ! + + + + + + + + + + + + + + + + + + + + + + + + + + + +
23 ! + + + + + + + + + + + + + + + + + + + + + + + + + + + +
24 
25 !-------------------------------------------------------!
26  subroutine join_neoclassic(NEOCLASSICin1, &
27  neoclassicin2, &
28  neoclassicout)
29 !-------------------------------------------------------!
30 ! This routine
31 !
32 !-------------------------------------------------------!
33 ! Source: --- !
34 ! Developers:
35 ! Kontacts:
36 ! !
37 ! Comments:
38 !
39 ! !
40 !-------------------------------------------------------!
41 
42 
43  USE euitm_schemas
44  USE itm_constants
45  USE copy_structures
46  USE deallocate_structures
48 
49  IMPLICIT NONE
50 
51  TYPE (type_neoclassic), pointer :: neoclassicin1(:)
52  TYPE (type_neoclassic), pointer :: neoclassicin2(:)
53  TYPE (type_neoclassic), POINTER :: neoclassicout(:)
54  TYPE (type_compositions_type) :: compositions
55 
56  INTEGER, PARAMETER :: nslice = 1 !number of CPO ocurancies in the work flow
57  INTEGER :: nrho1, nrho2
58  INTEGER :: nnucl
59  INTEGER :: nion, iion
60  INTEGER :: nimp, iimp, izimp
61  INTEGER, ALLOCATABLE :: nzimp(:)
62  INTEGER :: nneut
63  INTEGER, ALLOCATABLE :: ncomp(:)
64  INTEGER, ALLOCATABLE :: ntype(:)
65 
66 
67 
68 !-------------------------------------------------------!
69 
70 
71  nrho1 = size(neoclassicin1(1)%rho_tor)
72  nrho2 = size(neoclassicin2(1)%rho_tor)
73 ! CALL GET_COMP_DIMENSIONS (NEOCLASSICin(1)%COMPOSITIONS, NNUCL, NION, NIMP, NZIMP, NNEUT, NTYPE, NCOMP)
74 
75 
76  allocate(neoclassicout(1))
77  call copy_cpo(neoclassicin1(1), neoclassicout(1))
78 
79 
80 ! ++ sigma
81  if (associated(neoclassicin2(1)%sigma)) then
82  if (associated(neoclassicout(1)%sigma)) deallocate(neoclassicout(1)%sigma)
83  allocate(neoclassicout(1)%sigma(nrho1))
84  call l3interp(neoclassicin2(1)%sigma, neoclassicin2(1)%rho_tor, nrho2, &
85  neoclassicout(1)%sigma, neoclassicout(1)%rho_tor, nrho1)
86  end if
87 
88 ! ++ bootstrap current
89  if (associated(neoclassicin2(1)%jboot)) then
90  if (associated(neoclassicout(1)%jboot)) deallocate(neoclassicout(1)%jboot)
91  allocate(neoclassicout(1)%jboot(nrho1))
92  call l3interp(neoclassicin2(1)%jboot, neoclassicin2(1)%rho_tor, nrho2, &
93  neoclassicout(1)%jboot, neoclassicout(1)%rho_tor, nrho1)
94  end if
95 
96 
97 !+++ ADD IDENTIFIER TO OUTPUT CPO VALUES(1):
98  !ALLOCATE (CORETRANSP(1)%VALUES(1)%transportid%id(1))
99  !ALLOCATE (CORETRANSP(1)%VALUES(1)%transportid%description(1))
100  !CORETRANSP(1)%VALUES(1)%transportid%id = 'neoclassical'
101  !CORETRANSP(1)%VALUES(1)%transportid%flag = 2
102  !CORETRANSP(1)%VALUES(1)%transportid%description = 'Neoclassical'
103 
104 
105 
106 
107 
108  RETURN
109 
110 
111  END SUBROUTINE join_neoclassic
112 ! + + + + + + + + + + + + + + + + + + + + + + + + + + + +
113 ! + + + + + + + + + + + + + + + + + + + + + + + + + + + +
114 
115 
116 END MODULE joiner
subroutine join_neoclassic(NEOCLASSICin1, NEOCLASSICin2, NEOCLASSICout)
This routine joins CPOs.
Definition: joiner.f90:26
subroutine l3interp(y_in, x_in, nr_in, y_out, x_out, nr_out)
Definition: l3interp.f90:1
Module joins CPOs.
Definition: joiner.f90:9
This module contains routines for allocation/deallocation if CPOs used in ETS.