ETS  \$Id: Doxyfile 2162 2020-02-26 14:16:09Z g2dpc $
 All Classes Files Functions Variables Pages
Spider_call.f
Go to the documentation of this file.
1  subroutine spider(nstep,time,dt,key_dmf,k_grid,k_auto,k_fixfree,
2  & dpsdt,key_ini,voltpf)
3 
4 c---------------------------------------------------------------
5 c main PROGRAM of the evolution code "PET"
6 c---------------------------------------------------------------
7 
8  IMPLICIT REAL*8( a-h, o-z )
9  common /com_0st/ key_0st,key_prs
10  dimension contvals_mat(2500),d_pf_mat(500)
11  dimension voltpf(*)
12  dimension d_cam_mat(500)
13 ! save i_enter
14  integer, save :: i_enter
15  data i_enter /0/
16 
17  i_enter=i_enter+1
18 
19  if(i_enter .eq. 1) then
20  do i=1,19
21  voltpf(i)=0.d0
22  enddo
23  endif
24 
25 c kpr=1 for debugging, kpr=0 no printing
26 
27  !kpr=1
28  !call kpr_calc(kpr)
29 
30  !tau_con=2.0d-2
31  !k_con=(tau_con+1.d-8)/dt
32  !k_con=999999
33 
34 !!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!
35  call put_tim(dt,time)
36  call put_key_fix(k_fixfree)
37 !!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!
38 
39  if(nstep.eq.0) then
40  kluch = 0
41  else
42  kluch = 1
43  endif
44 
45  if(k_fixfree.eq.0) then
46  call b_stepon( kluch, k_auto, nstep, dt, time,
47  * rax,zax ,key_dmf,dpsdt)
48  ! call cur_avg
49  ! call wrb
50  !write(*,*) '**'
51  !write(*,*) 'nstep,time',nstep,time
52  !write(*,*) '**'
53 
54 
55  if(key_0st.eq.1 .AnD. nstep.eq.0) then
56  nnstep=1
57  kkey_dmf=-10
58  kluch = 1
59 
60 
61  call b_stepon( kluch, k_auto, nnstep, dt, time,
62  * rax,zax ,kkey_dmf,dpsdt)
63 
64 
65 
66 
67 
68  nstep=0
69 
70 
71  endif
72 
73 
74 
75 
76  return
77  endif
78 
79 c---------------------
80  !k_auto= 0
81 
82 c----------------
83 !!! ! k_grid= 0 rect. grid
84 !!! ! k_grid= 1 adap. grid
85 
86 
87  if(kluch.eq.0) then !initialization
88 
89 !
90 !!!!! basic free bound rectan, equilibrium ( KLUCH=0 )
91 !
92  !key_ini=1
93 
94  if(key_ini .le. 0) then
95 
96  call sstepon( kluch, k_auto,nstep,dt,time,
97  * voltpf, d_pf_mat ,d_cam_mat,key_dmf)
98 
99  else
100  call cf_init( k_auto, nstep, dt, time,
101  * voltpf, d_pf_mat,d_cam_mat )
102 
103  endif
104 
105  !call wrfb
106  call wrrec
107 
108 c stop
109 
110  k_auto= 0 ! don't change!
111 
112  if(k_grid.eq.1) then
113 
114  call f_stepon( kluch, k_auto,nstep,dt,time,
115  * voltpf, d_pf_mat ,d_cam_mat,rax,zax,key_dmf)
116  endif
117 
118  !call cntrlr_iter(0,k_grid,voltpf)
119 
120  elseif(kluch.eq.1) then !time steping
121 
122 
123 
124  print *,' Next step: stepon',nstep
125 
126  ! nstep1=i_enter-1
127  !if(nstep1/k_con*k_con .eq. nstep1) then
128  ! do i=1,19
129  ! voltpf(i)=0.d0
130  ! enddo
131  ! call cntrlr_iter(1,k_grid,voltpf)
132  !endif
133 
134  if(k_grid.eq.0) then
135  call sstepon( kluch, k_auto,nstep,dt,time,
136  * voltpf, d_pf_mat ,d_cam_mat,key_dmf)
137  elseif(k_grid.eq.1) then
138 
139  call f_stepon( kluch, k_auto,nstep,dt,time,
140  * voltpf, d_pf_mat ,d_cam_mat,rax,zax,key_dmf)
141  call cur_avg
142  call f_wrd
143  endif
144 
145  !print *,' After f_stepon'
146 
147 
148  if(nstep/20*20.eq.nstep) then
149  call wrd_tim
150  endif
151 
152  write(*,*) '**'
153  write(*,*) 'nstep,time',nstep,time
154  write(*,*) '**'
155 
156  endif !time steping
157 
158 
159 
160 
161 
162  return
163  end
164 
165 !!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!
166 
167 !!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!
168  subroutine get_psix(r_xp,z_xp,psi_xp)
169 
170  include 'double.inc'
171  include 'param.inc'
172  include 'comblc.inc'
173 
174  r_xp=rx0
175  z_xp=zx0
176  psi_xp=ux0
177 
178  return
179  end
180 !!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!
181 !!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!
182  subroutine get_fpsix(r_xp,z_xp,psi_xp)
183 
184  include 'double.inc'
185  include 'parevo.inc'
186  parameter(nkp=njlim)
187  include 'dim.inc'
188  include 'compol.inc'
189  include 'compol_add.inc'
190 
191  r_xp=rx0
192  z_xp=zx0
193  psi_xp=psix0
194 
195  return
196  end
197 !!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!
198  subroutine get_psib(r_ax,z_ax,psi_b)
199 
200  include 'double.inc'
201  include 'param.inc'
202  include 'comblc.inc'
203 
204  r_ax=rm
205  z_ax=zm
206  psi_b=up
207 
208  return
209  end
210 !!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!
211 
212 !!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!
213 
214 !!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!
215  subroutine kpr_calc(kpr_xx)
216 
217  !include 'double.inc'
218  common
219  * /c_kpr/kpr
220 
221  kpr=kpr_xx
222 
223  !print *,' kpr FOR DEBUGING',kpr
224  return
225  end
226 
227 
228 
229  subroutine pau()
230  return
231  end
232 !!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!
233 !!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!
234  subroutine put_name(name,ksym)
235  include 'iopath.inc'
236  character*40 name
237  integer ksym
238  path=name
239  kname=ksym
240  return
241  end
242 !!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!
243  subroutine put_ipl(placur)
244 
245  include 'double.inc'
246  common /com_curpl/ cur_pl
247 
248  cur_pl=placur
249 
250  return
251  end
252 !!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!
253  subroutine get_ipl(placur)
254 
255  include 'double.inc'
256  common /com_curpl/ cur_pl
257 
258  placur=cur_pl
259 
260  return
261  end
262 !!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!
263 
264 
265 
subroutine sstepon(KLUCH, k_auto, nstep, dt, time,
Definition: sstepon.f:3
subroutine get_psix(r_xp, z_xp, psi_xp)
Definition: Spider_call.f:168
subroutine put_ipl(placur)
Definition: Spider_call.f:243
subroutine b_stepon(KLUCH, k_auto, nstep, dt, time,
Definition: sstepon_r.f:3
subroutine put_tim(dt, time)
Definition: B_eqb.f:944
subroutine f_wrd
Definition: _wrd.f:107
subroutine get_ipl(placur)
Definition: Spider_call.f:253
subroutine get_psib(r_ax, z_ax, psi_b)
Definition: Spider_call.f:198
subroutine kpr_calc(kpr_xx)
Definition: Spider_call.f:215
subroutine put_key_fix(k)
subroutine wrd_tim
Definition: _wrd.f:1
subroutine cur_avg
Definition: com_sub.f:813
subroutine code(ZIX, ZIY, C)
Definition: ppplib.f:570
subroutine get_fpsix(r_xp, z_xp, psi_xp)
Definition: Spider_call.f:182
subroutine wrrec
Definition: Eq2_m.f:1453
subroutine spider(nstep, time, dt, key_dmf, k_grid, k_auto, k_fixfree,
Definition: Spider_call.f:1
subroutine evolution(T, R_in, R_out, El, Tr_l, Tr_U, Ip)
subroutine f_stepon(KLUCH, k_auto, nstep, dt, time,
Definition: sstepon_r.f:169
subroutine put_name(name, ksym)
Definition: Spider_call.f:234
subroutine pau()
Definition: Spider_call.f:229