1 subroutine spider(nstep,time,dt,key_dmf,k_grid,k_auto,k_fixfree,
2 & dpsdt,key_ini,voltpf)
4 c---------------------------------------------------------------
6 c---------------------------------------------------------------
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)
12 dimension d_cam_mat(500)
14 integer,
save :: i_enter
19 if(i_enter .eq. 1)
then
25 c kpr=1 for debugging, kpr=0 no printing
45 if(k_fixfree.eq.0)
then
46 call
b_stepon( kluch, k_auto, nstep, dt, time,
47 * rax,zax ,key_dmf,dpsdt)
55 if(key_0st.eq.1 .AnD. nstep.eq.0)
then
61 call
b_stepon( kluch, k_auto, nnstep, dt, time,
62 * rax,zax ,kkey_dmf,dpsdt)
79 c---------------------
94 if(key_ini .le. 0)
then
96 call
sstepon( kluch, k_auto,nstep,dt,time,
97 * voltpf, d_pf_mat ,d_cam_mat,key_dmf)
100 call cf_init( k_auto, nstep, dt, time,
101 * voltpf, d_pf_mat,d_cam_mat )
114 call
f_stepon( kluch, k_auto,nstep,dt,time,
115 * voltpf, d_pf_mat ,d_cam_mat,rax,zax,key_dmf)
120 elseif(kluch.eq.1)
then
124 print *,
' Next step: stepon',nstep
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
139 call
f_stepon( kluch, k_auto,nstep,dt,time,
140 * voltpf, d_pf_mat ,d_cam_mat,rax,zax,key_dmf)
148 if(nstep/20*20.eq.nstep)
then
153 write(*,*)
'nstep,time',nstep,time
189 include
'compol_add.inc'
246 common /com_curpl/ cur_pl
256 common /com_curpl/ cur_pl
subroutine sstepon(KLUCH, k_auto, nstep, dt, time,
subroutine get_psix(r_xp, z_xp, psi_xp)
subroutine put_ipl(placur)
subroutine b_stepon(KLUCH, k_auto, nstep, dt, time,
subroutine put_tim(dt, time)
subroutine get_ipl(placur)
subroutine get_psib(r_ax, z_ax, psi_b)
subroutine kpr_calc(kpr_xx)
subroutine put_key_fix(k)
subroutine code(ZIX, ZIY, C)
subroutine get_fpsix(r_xp, z_xp, psi_xp)
subroutine spider(nstep, time, dt, key_dmf, k_grid, k_auto, k_fixfree,
subroutine evolution(T, R_in, R_out, El, Tr_l, Tr_U, Ip)
subroutine f_stepon(KLUCH, k_auto, nstep, dt, time,
subroutine put_name(name, ksym)