ETS  \$Id: Doxyfile 2162 2020-02-26 14:16:09Z g2dpc $
 All Classes Files Functions Variables Pages
sstepon.f
Go to the documentation of this file.
1 !!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!
2 !
3  SUBROUTINE sstepon( KLUCH, k_auto, nstep, dt, time,
4  * voltpf, d_pf_mat,d_tcam_mat,key_dmf )
5 
6  use durs_d_modul
7 
8 c---------------------------------------------------------------
9  include 'Descript.inc'
10 c ----------
11 c
12  include 'double.inc'
13 c
14  include 'prm.inc'
15  include 'comevl.inc'
16  !INCLUDE 'contro.inc'
17  !parameter(nstep_p=3000)
18 c-----------------------------------------------------------------------
19  include 'comtim.inc'
20 
21  common/comeqg/ ncequi
22  common /nostep/ kstep
23  common /comhel/ helinp, helout
24 
25 ! common /comsta/ epsro,platok,
26 ! * eqdfn,betplx,tokf,psax,b0,r0,
27 ! * alf0,alf1,alf2,bet0,bet1,bet2,rax,zax,
28 ! * nurs,igdf,n_psi,n_tht,i_bsh,keyctr,i_betp,i_eqdsk
29 
30  common /comsta/ platok,eqdfn,i_bsh
31 
32  common /com234/ betpol,tokout,psiout
33  common /com_cam/ camtok
34  common /c_kpr/ kpr
35  common /key_for_pet/ key_fixbon
36  common/com_flag/kastr
37 c-----------------------------------------------------------------------
38 c
39  dimension rc(nclim), zc(nclim), pc(nclim), psip(nclim),
40  * vc(nclim), hc(nclim)
41 c
42  dimension rc1(nclim), zc1(nclim), rc2(nclim), zc2(nclim),
43  * rc3(nclim), zc3(nclim), rc4(nclim), zc4(nclim)
44 c
45  INTEGER necon(nilim), ntype(nclim)
46  dimension wecon(nilim)
47 c
48  common/comst0/ res(njlim), volk(njlim), volkp1(njlim)
49 c
50  common/comst1/ pjk(njlim),pjkp1(njlim),pjkp(njlim),pjkd(njlim)
51  include 'parloo.inc'
52  common/comloo/ rloop(nloopp),zloop(nloopp),
53  & rprob(nprobp),zprob(nprobp),fiprob(nprobp),nloop,nprob
54  common/comst2/ psk(njlim), pskp1(njlim),pskp(njlim),pskm1(njlim)
55 
56  !DIMENSION cp_com_0(n_cp_m)
57 c***********************************************************************
58 
59  dimension psiplb(nstep_p),psiexb(nstep_p),psimag(nstep_p),
60  * flu_tor(nstep_p)
61 
62 c***********************************************************************
63 
64  real*8 voltpf(*)
65  real*8 d_pf_mat(*)
66  real*8 d_tcam_mat(*)
67 
68 c***********************************************************************
69 
70 
71  real*4 a_print(200)
72  character*30 apr
73  character*40 eqdfn
74 
75 
76  ! call put_tim(dt,time)
77 
78  kstep = nstep
79  timev = time
80  tstep = dt
81 
82 
83 !(((((((((((((((((((((((
84 ! i_diag=1
85 !)))))))))))))))))))))))
86 
87  pi = 3.14159265359d0
88  bbb = 1.d0 / (2.d0*pi)
89 
90  sigm = 1.d0 !0.50d0
91 
92  tstepr = tstep
93  tstart = 0.00d0
94 
95  tstop = 20.0d0
96  kstop = 1000
97 
98  enels = 5.0d-8
99  knels = 500
100 
101  nfrpr1 = 5
102  nfrwr1 = 0
103 
104  nout = 17
105  nter = 6
106  ninfw = 7
107  ninev = 10
108  ngra1 = 14
109  ngra2 = 15
110 c
111 
112 
113  IF( kluch .NE. 0 ) go to 1111
114 
115  1149 format(a40)
116 c
117  ! OPEN( NOUT, FILE='EVOL0.PRT', FORM='FORMATTED' )
118  !write(nout,*) '***********************************************'
119  ! write(nout,*) '! OUTPUT FILE !'
120  ! write(nout,*) '! OF !'
121  ! write(nout,*) '! the PET code (Plasma Evolution in Tokamak) !'
122  ! write(nout,*) '! ------------------------------------------- !'
123  ! write(nout,*) '! free boundary tokamak equilibrium problem !'
124  ! write(nout,*) '! and !'
125  ! write(nout,*) '! circuit equations !'
126  ! write(nout,*) '***********************************************'
127 c
128  numwr = 0
129 c--------------------------------------------------------------------
130 c
131 c======iter, sof
132 c
133 c=============================================
134 
135  kstepr = kstep
136  keypri = 1
137 
138 c-----------------------------------------------------------------
139 c --- input of "BASIC" equlibrium parameters from file "durs.dat"
140 c
141 !!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!
142 
143  if(k_auto.eq.0) go to 2005
144 
145 !!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!
146  if(kastr.eq.1) go to 1150
147 
148  write(fname,'(a,a)') path(1:kname),'durs.dat'
149  open(1,file=fname)
150  !open(1,file='durs.dat')
151 
152  read(1,*) n_tht
153  read(1,*) n_psi
154  read(1,*) igdf
155  read(1,*) epsro
156 
157  read(1,*) nurs
158  read(1,*) keyctr
159 
160  read(1,*) i_eqdsk
161  read(1,1149) eqdfn
162 
163  read(1,*) i_betp
164  read(1,*) betplx
165  read(1,*) tokf
166  read(1,*) psax
167  read(1,*) b0,r0
168  !!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!
169  read(1,*) alf0 !!
170  read(1,*) alf1 !! P'=alf0*(1-(1-psi)**alf1)**alf2
171  read(1,*) alf2 !!
172  !!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!
173  read(1,*) bet0 !!
174  read(1,*) bet1 !! FF'=bet0*(1-(1-psi)**bet1)**bet2
175  read(1,*) bet2 !!
176  !!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!
177  read(1,*) alw0 !!
178  read(1,*) alw1 !! (ro*w**2)'=alw0*(1-(1-psi)**alw1)**alw2
179  read(1,*) alw2 !!
180  !!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!
181  read(1,*) rax
182  read(1,*) zax
183 
184  close(1)
185 
186  if(i_eqdsk.eq.1) then
187 
188  call tab_efit(tokf,psax,eqdfn,rax,zax,b0,r0)
189 
190  nurs = -3999
191  i_betp = 0
192 
193  endif
194 
195  write(fname,'(a,a)') path(1:kname),'durs_d.dat'
196  open(1,file=fname,form='formatted')
197  !open(1,file='durs_d.dat')
198  write(1,*) n_tht,n_psi,igdf,nurs,keyctr,i_eqdsk,i_betp
199  write(1,*) epsro,betplx,tokf,psax,b0,r0,rax,zax
200  write(1,*) alf0,alf1,alf2,bet0,bet1,bet2
201  close(1)
202 
203  1150 continue
204 
205 
206 c***********************************************************************
207 c--- input of positions of "PF_PROBE" points:
208 c
209  CALL propnt( nout, nter, ninfw, ngra1,
210  * npro, rprob, zprob, fiprob )
211 c***********************************************************************
212 c--- input of positions of "FL_LOOP" points:
213 c
214  CALL loopnt( nout, nter, ninfw, ngra1,
215  * nloop, rloop, zloop )
216 c***********************************************************************
217 !!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!
218 
219 c***********************************************************************
220 c--- input parameters of pfc system and passiv conductors
221 c
222  CALL conduc( nc, ncequi, ncpfc, nfw, nbp, nvv,
223  * rc,zc, pc, vc,hc, ntype,
224  * rc1,zc1, rc2,zc2, rc3,zc3, rc4,zc4,
225  * res, volk, volkp1,
226  * necon, wecon,
227  * nout, nter, ninfw, ngra1 )
228 
229 
230 
231 c
232 c***********************************************************************
233 c--- definition induct. and selfinduct. matrix
234 c--- for "EDDY" conductors: "PPIND" from COMMON /ppidps/
235 c *******
236 c
237  CALL l_matr( nout, nter, nc, ncpfc,
238  * ntype, rc, zc, vc, hc,
239  * necon,wecon )
240 c
241 c-----------------------------------------------------------------------
242 c --- initial condition(currents) for circuit equations
243 c
244 
245  DO 17 l=1,ncequi
246  IF( l.LE.nequi ) THEN
247  pjk(l) = pfceqw(l)
248  pjkp(l) = pjk(l)
249  ELSE
250  pjk(l) = pc(ncpfc+l-nequi)
251  pjkp(l) = pjk(l)
252  END IF
253  17 CONTINUE
254 
255 
256 
257  write(fname,'(a,a)') path(1:kname),'currents.wr'
258  open(1,file=fname,form='formatted')
259  !open(1,file='currents.wr',form='formatted')
260  write(1,*) nequi,ncequi
261  write(1,*)(pjk(j),j=1,ncequi)
262  close(1)
263 
264  write(fname,'(a,a)') path(1:kname),'res_mat.wr'
265  open(1,file=fname,form='formatted')
266  !open(1,file='res_mat.wr')
267  write(1,*) (res(j),j=1,ncequi)
268  close(1)
269 
270 c
271 c..... toroidal currents of passive conductor structures
272 c
273 ! CALL PASCUR( NOUT, NTER, NEQUI, NFW, NBP, NVV,
274 ! * PJK, fwcurr, bpcurr, vvcurr )
275 c
276 c********************************************************************
277 
278 ! WRITE(NOUT,*) '********************************************'
279 ! WRITE(NOUT,*) ' NUMBER TIME-LEVEL KSTEP =', KSTEP
280 ! WRITE(NOUT,*) '********************************************'
281 
282 cccc include 'printb.inc'
283 
284  helout = helinp
285 c
286 
287 !!!!! WRITE(NTER,*) 'START OF BASIC FREE BOUNDARY EQUILIBRIUM'
288 
289  call wrcoil(nc,ncpfc,rc,zc,pc,necon,wecon)
290 
291  ngrid=1
292 
293  call auto(rc,zc,pc,nc,nstep,ngrid,
294  * rc1,zc1, rc2,zc2,
295  * rc3,zc3, rc4,zc4,
296  * ntype, necon, wecon )
297 
298 
299 !(((((((((((((((((((((((((((((((((((((((((
300 ! if(i_diag.eq.1)then
301 ! call diag_params()
302 ! call diag_MATR(NC, NCPFC, nequi,
303 ! * RC,ZC,NECON,WECON,
304 ! * NLOO, RLOO, ZLOO ,
305 ! * NPRO, RPRO, ZPRO, FIPRO
306 ! * )
307 !))))))))))))))))))))))))))))))))))))))))))
308 
309 
310 !((((((((((((((((((((((((((
311 ! call write_diag()
312 !))))))))))))))))))))))))))
313 
314 
315 !!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!
316  2005 continue
317 !!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!
318  if(kastr.eq.0 .AnD. i_eqdsk.eq.0) then
319  write(fname,'(a,a)') path(1:kname),'inpol.dat'
320  open(1,file=fname,form='formatted')
321  !open(1,file='inpol.dat')
322  read(1,*) i_bsh
323  close(1)
324  else
325  i_bsh=1
326  endif
327 
328  if(kastr.eq.0 ) then
329  write(fname,'(a,a)') path(1:kname),'durs_d.dat'
330  open(1,file=fname,form='formatted')
331  !open(1,file='durs_d.dat')
332  read(1,*) n_tht,n_psi,igdf,nurs,keyctr,i_eqdsk,i_betp
333  read(1,*) epsro,betplx,tokf,psax,b0,r0,rax,zax
334  read(1,*) alf0,alf1,alf2,bet0,bet1,bet2
335  close(1)
336  endif
337 
338 
339 !!:::::::::::::::::__________________________________:::::::::::::::
340 
341  call noauto
342 
343  call rd_ppind
344 
345  call rd_prob( nprob, rprob, zprob, fiprob )
346 
347  call rd_loop( nloop, rloop, zloop )
348 
349 
350  write(fname,'(a,a)') path(1:kname),'currents.wr'
351  open(1,file=fname,form='formatted')
352  !open(1,file='currents.wr',form='formatted')
353  read(1,*) nequi,ncequi
354  read(1,*)(pjk(j),j=1,ncequi)
355  close(1)
356 
357  write(fname,'(a,a)') path(1:kname),'res_mat.wr'
358  open(1,file=fname,form='formatted')
359  !open(1,file='res_mat.wr')
360  read(1,*) (res(j),j=1,ncequi)
361  close(1)
362 
363  !fr_cam=0.d0
364  !do j=nequi+1,ncequi
365  ! fr_cam=fr_cam+1.d0/res(j)
366  !enddo
367  ! fr_cam=1.d0/fr_cam
368 
369  do l=1,ncequi
370  pjkp(l) = pjk(l)
371  enddo
372 
373 
374 !(((((((((((((((((((((((((((((((((((((((((((
375 ! if(i_diag.eq.1)then
376 ! call diag_params()
377 ! call read_diag()
378 ! call curr_to_dina(ncequi,pjk,tokf)
379 ! end if
380 !)))))))))))))))))))))))))))))))))))))))))))
381 
382 cccc voltage for zero time-level
383 c
384  DO i=1,nequi
385  volk(i) = voltpf(i)*bbb
386  END DO
387  DO i=nequi+1,ncequi
388  volk(i) = 0.0d0
389  END DO
390 
391 
392 
393  platok = tokf
394  kstep = 0
395  k_step=0
396  ngav=keyctr
397 
398 
399 
400  call eqb( alf0,alf1,alf2, bet0,bet1,bet2, alw0,alw1,alw2,
401  * betplx, i_betp,
402  * ngav, k_step, platok, rax,zax, b0,r0, psax, igdf,
403  * n_tht, n_psi, epsro, nurs, i_eqdsk,i_bsh,
404  * psi_bnd,psi0_bnd)
405 
406 
407 
408 c call pau()
409 
410  ngrid=1
411 
412 
413  nursb=nurs
414  psicen=psax
415  ngav1=0
416  ftok=tokf
417 
418 
419  call eq_0( pjk,psip,ncequi,kstep,ngrid,
420  * alf0,alf1,alf2,bet0,bet1,bet2,
421  * betpol,betplx,zli3,
422  * ngav1,
423  * ftok, tokout, psiax, psiout,
424  * nursb,psi_bnd,alp_b,rax,zax,n_ctrl,b0,r0 )
425 
426  call rdexf(ncequi)
427 
428  call eq( pjk, psk, ncequi, kstep, ngrid,
429  * alf0, alf1, alf2, bet0, bet1, bet2,
430  * betpol, betplx, zli3,
431  * ngav1,
432  * ftok, tokout, psiax, psiout,
433  * nursb,psi_bnd,alp_b,rax,zax )
434 
435 
436 !!!!!!!!!!!!!!!!!!!!!!!!!!ttt!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!
437 
438  !WRITE(NOUT,*) ' '
439  !WRITE(NOUT,*) 'PRINT AFTER BASIC FREE BOUNDARY EQUILIBRIUM'
440 
441  CALL eq_par( z0cen, alp, alpnew, qcen, nctrl, numlim, up,
442  * rm, zm, rx0, zx0 )
443 c***********************************************************************
444 
445 c --- for diagnostic
446 
447  rmax0 = rm
448  zmax0 = zm
449  zcen0 = z0cen
450 c ---------------------
451  beold = betpol
452  zlold = zli3
453 c ---------------------
454  raxpr = rm
455  zaxpr = zm
456  rmaold = rm
457  zmaold = zm
458  rxppr = rx0
459  zxppr = zx0
460  rxpold = rx0
461  zxpold = zx0
462 c-----------------------------------------------------------------------
463 c --- definition of input parameters from "basic" equilibrium
464 
465  betplx = betpol
466  betap0 = betpol
467  ftok = tokout
468  psiax = psiout
469  helinp = helout
470 c ----------------------------------------------------------------------
471 c for psi_axis value time scenario(for ngav1=2 or 3)
472 
473  time_sta = tstart
474  time_fin = tstop
475 
476  psax_sta = psiout
477 
478 c***********************************************************************
479 
480  psibou = up
481  psidel = psiout - psibou
482 
483 cccc include 'printa.inc' ! --- PRINTING
484 
485 c***********************************************************************
486 c--- printing and writing of numbers and positions of limiter points:
487 
488  !CALL PRTLIM( NOUT, NTER, NGRA1 )
489 c***********************************************************************
490 c***********************************************************************
491 c--------------------- writing in the disk files -----------------------
492  ! include 'wrt1.inc'
493 c-----------------------------------------------------------------------
494  !WRITE(NOUT,*) '--------------------------------------------'
495  !WRITE(NOUT,*) ' THE END OF FILE: "EVOL0.PRT" '
496  !WRITE(NOUT,*) '--------------------------------------------'
497 
498  !CLOSE(NOUT)
499 
500 c***********************************************************************
501 cccc OPEN (nout, file='EVOL1.PRT', form='FORMATTED')
502 
503 c --- If we need to compute the "basic" equilibrium only -> kstop=0
504 
505  IF( kstop.EQ.0 ) THEN
506  go to 222
507  END IF
508 c***********************************************************************
509 c!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!
510 
511 
512 1 continue
513 
514  i_bsh = -1
515  i_eqdsk = 0
516  kstep = 0
517  keyctr = 0
518  e_psi = 0.d0
519 
520 
521  call eqb( alf0,alf1,alf2, bet0,bet1,bet2, alw0,alw1,alw2,
522  * betplx, i_betp,
523  * keyctr, kstep, platok, rax,zax, b0,r0, psax, igdf,
524  * n_tht, n_psi, epsro, nurs, i_eqdsk,i_bsh,
525  * psi_bnd,psi0_bnd)
526 
527 
528  call get_par(psi_bnd)
529 
530  call bongri
531  call psib_pla(pspl_av)
532  call psib_ext(psex_av)
533 
534  psi0_bnd=pspl_av+psex_av
535 
536 
537  ztok_n = platok
538  zpsim_n = psax
539 
540 
541  return
542 
543 !!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!
544 !!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!
545 
546 cccc WRITE(nout,*) ' NEW TIME-LEVEL K = KSTEP =', kstep
547 
548  1111 CONTINUE
549  !call test_urs
550 
551  keyctr = key_dmf
552  !keyctr = 500
553 
554  call get_par(psi_bnd)
555  call bongri
556  !2241 continue
557  call psib_pla(pspl_av)
558  call psib_ext(psex_av)
559 
560  psi0_bnd=pspl_av+psex_av
561 
562 
563  ztok_n = platok
564  zpsim_n = psax
565 
566 
567 ! 100 KSTEP = KSTEP + 1 !!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!
568 ! TIMEV = TIMEV + TSTEP !!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!
569 !!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!
570 
571  ngav1 = 0
572 
573 c********************************************************************
574 c definition of "KEYPRI" - PARAMETER for printing
575 
576 ! IF((KSTEP/NFRPR1)*NFRPR1 .EQ. KSTEP) THEN
577 ! KEYPRI = 1
578 ! ELSE
579  keypri = 0
580 ! END IF
581 
582 
583 c====================================================================
584 c definition of input equil. parameters: betplx, psiax, ftok, helinp
585 
586  IF(ngav1.EQ.0 .OR. ngav1.EQ.2 .OR. ngav1.EQ.4)
587  * betplx = betpol
588  IF( ngav1.EQ.0 .OR. ngav1.EQ.1 ) THEN
589  psiax = psiout
590  helinp = helout
591  END IF
592  IF( ngav1.EQ.2 .OR. ngav1.EQ.3 ) THEN
593  ftok = tokout
594  helinp = helout
595  END IF
596  IF( ngav1.EQ.4 .OR. ngav1.EQ.5 ) THEN
597  ftok = tokout
598  psiax = psiout
599  END IF
600 c
601 c***********************************************************************
602 c computing of "VOLKP1" voltage for circuit equation
603 c for new time level kstep
604 c
605 
606  DO i=1,nequi
607  volkp1(i) = voltpf(i)*bbb
608  END DO
609  DO i=nequi+1,ncequi
610  volkp1(i) = 0.0d0
611  END DO
612 c-----------------------------------------------------------------------
613 cccc include 'printb.inc' !Printing
614 c***********************************************************************
615  ! call test_urs
616 
617  call bongri
618  call psib_pla(pspl_av)
619  call psib_ext(psex_av)
620  call get_flfi(flx_fi)
621 
622  psi0_bnd=pspl_av+psex_av
623  psi0_ax=pspl_av+psex_av+psax
624  ztok=platok
625  zpsim=psax
626  i_bsh=-1
627 
628 !!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!
629 
630  !call test_urs
631 
632  n_dmf=3
633  if(keyctr.eq.0) n_dmf=1
634 
635  do it_dmf=1,n_dmf !!! it_dmf <<< mag.field diffusion iter. loop
636 
637 
638  if(kpr.eq.1)print *,' it_dfm==',it_dmf
639 
640  if(keyctr.ne.0) then
641  call eqb( alf0,alf1,alf2, bet0,bet1,bet2, alw0,alw1,alw2,
642  * betplx, i_betp,
643  * keyctr, kstep, platok, rax,zax, b0,r0, psax, igdf,
644  * n_tht, n_psi, epsro, nurs, i_eqdsk,i_bsh,
645  * psi_bnd,psi0_bnd )
646  endif
647 
648 c print *,' psax keyctr platok=',psax,keyctr,platok
649 
650 c read (*,*)
651  !call test_urs
652 
653  call wrb
654  !call test_urs
655 
656  ftok=platok
657 
658 
659  !if(key_fixbon.eq.1) exit
660 
661 
662  IF( kstep.EQ.1 ) THEN
663 
664  ngrid = 1
665 
666  DO l=1,ncequi
667  pskp1(l) = psk(l)
668  enddo
669 
670  nreg = 0
671  nles = 0
672  !call test_urs
673 
674  CALL evslv( nles, nreg, tstep, tstep, sigm,
675  * ncequi, volk, volkp1, res,
676  * psk, pskp1, pjk, pjkp1, pjkp,
677  * nout, nter, keypri, ereve )
678 
679  !call test_urs
680  END IF !!! ===> FOR IF( KSTEP.EQ.1 )
681 c***********************************************************************
682  IF(kstep.NE.1) THEN
683 
684 c----------------------------------------------------------------
685 c the initial approximation for the case of closed-loop evolution
686 c
687  DO l=1,ncequi
688  pjkp(l) = pjk(l)
689  enddo
690 c----------------------------------------------------------------
691 c
692  nreg = 0
693  nles = 1
694 
695  !call test_urs
696 
697  CALL evslv( nles, nreg, tstepr, tstep, sigm,
698  * ncequi, volk, volkp1, res,
699  * pskm1, psk, pjk, pjkp1, pjkp,
700  * nout, nter, keypri, ereve )
701 
702 
703  END IF !!! ===> FOR IF( KSTEP.NE.1 )
704 c***********************************************************************
705  !call test_urs
706  CALL eq_ax( pjkp1, pskp1, ncequi, kstep, ngrid,
707  * alf0, alf1, alf2, bet0, bet1, bet2,
708  * betpol, betplx, zli3,
709  * ngav1,
710  * ftok, tokout, psiax, psiout,
711  * enels, erps,
712  * psi_bnd,alp_b,rax,zax,0 )
713 
714 
715 
716 
717 !(((((((((((((((((((((((((((((((((((((((((((
718 ! if(i_diag.eq.1)then
719 ! call psi_diag()
720 ! call curr_to_dina(ncequi,pjkp1,ftok)
721 ! call loopflux()
722 ! call probefield()
723 ! end if
724 !)))))))))))))))))))))))))))))))))))))))))))
725 
726 
727  CALL eq_par( z0cen, alp, alpnew, qcen, nctrl, numlim, up,
728  * rm, zm, rx0, zx0 )
729 
730 c***********************************************************************
731 c --- start of the iteration loop
732 c***********************************************************************
733 
734  knel = 0
735  1000 knel = knel + 1
736 
737 
738  DO l=1,ncequi
739  pskp(l) = pskp1(l)
740  pjkp(l) = pjkp1(l)
741  ENDDO
742 
743  nreg = 0
744  nles = 2
745 
746  CALL evslv( nles, nreg, tstep, tstep, sigm,
747  * ncequi, volk, volkp1, res,
748  * psk, pskp1, pjk, pjkp1, pjkp,
749  * nout, nter, keypri, ereve )
750 
751 
752 
753 
754  CALL differ( pjkp, pjkp1, ncequi, errcu1, errcu2,
755  * curmax, curmin, nout, nter )
756 
757 c sgmcur = 1.00d0
758  sgmcur = 0.75d0
759 
760  DO l=1,ncequi
761  pjkp1(l) = sgmcur*pjkp1(l) + (1.0d0 - sgmcur)*pjkp(l)
762  END DO
763 c-----------------------------------------------------------------------
764 
765  CALL eq_ax( pjkp1, pskp1, ncequi, kstep, ngrid,
766  * alf0, alf1, alf2, bet0, bet1, bet2,
767  * betpol, betplx, zli3,
768  * ngav1,
769  * ftok, tokout, psiax, psiout,
770  * enels, erps,
771  * psi_bnd,alp_b,rax,zax,0 )
772 
773  write(*,*) 'stepon:EQ_AX done, erru=',erps
774 
775 
776 !(((((((((((((((((((((((((((((((((((((((((
777 ! if(i_diag.eq.1)then
778 ! call psi_diag()
779 ! call curr_to_dina(ncequi,pjkp1,ftok)
780 ! call loopflux()
781 ! call probefield()
782 ! end if
783 !)))))))))))))))))))))))))))))))))))))))))
784 
785 
786  CALL eq_par( z0cen, alp, alpnew, qcen, nctrl, numlim, up,
787  * rm, zm, rx0, zx0 )
788 
789  !write(*,*) 'stepon:eq_par done, erru=',ERPS
790 
791  IF(ngav1.EQ.2 .OR. ngav1.EQ.3) ftok = tokout
792  IF(ngav1.EQ.4 .OR. ngav1.EQ.5) ftok = tokout
793 
794  !DELBET = BETPOL - BEOLD
795  !DELZLI = ZLI3 - ZLOLD
796  !DELRMB = RM - RMAOLD
797  !DELZMB = ZM - ZMAOLD
798  !DELRXB = RX0 - RXPOLD
799  !DELZXB = ZX0 - ZXPOLD
800  !DELRMA = RM - RAXPR
801  !DELZMA = ZM - ZAXPR
802  !DELRXP = RX0 - RXPPR
803  !DELZXP = ZX0 - ZXPPR
804  !dvz=dabs( DELZMB/(DELZMA+1.d-10) )
805 
806 
807 
808 
809 ! CALL DIFGEO( RM, ZM, RAXPR, ZAXPR, RMAOLD, ZMAOLD,
810 ! * DELAXA, DELAXR, NOUT, NTER )
811 
812  !write(*,*) 'stepon:DIFGEO, erru=',ERPS
813 
814  !BEOLD = BETPOL
815  !ZLOLD = ZLI3
816  !RMAOLD = RM
817  !ZMAOLD = ZM
818  !RXPOLD = RX0
819  !ZXPOLD = ZX0
820 c
821 ! CALL DIFFER( PSKP, PSKP1, NCEQUI, ERRPS1, ERRPS2,
822 ! * PSIMAX, PSIMIN, NOUT, NTER )
823 ! CALL DIFTIM( PSK, PSKP, PSKP1, NCEQUI, DELPS1, DELPS2,
824 ! * DELMAX, DELMIN, NOUT, NTER )
825 
826  !write(*,*) 'stepon:DIFTIM, erru=',ERPS
827 
828 c!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!
829 c ----- control of EXIT from iteration loop ------
830 c n_pr = 5
831 c a_print(1) = knel
832 c a_print(2) = erps
833 c a_print(3) = delaxr
834 c a_print(4) = delzma
835 c a_print(5) = delzmb
836 c num = 30
837 c apr = 'KNEL ERPS DELAXR DELZst DELZit'
838 c call out42(n_pr,a_print,num,apr)
839 
840 c 1000 1000 1000 1000 1000 1000 1000 1000 1000 1000 1000 1000 1000 1000
841  write(*,*) 'stepon:erru',erps
842 
843  !IF( ERPS .LT. ENELS .AnD. dvz .LT. 5.d-3 ) THEN
844  IF( erps .LT. enels ) THEN
845 
846  !IF( dvz .LT. 5.d-3 ) THEN
847  go to 200
848  END IF
849  IF( knel .GE. knels ) THEN
850  keypri = 1
851  write(*,*) 'spider,sstepon: no covergence '
852  write(*,*) .GE.'KNEL KNELS ',knel,knels
853  pause 'pause'
854  go to 200
855  ELSE
856  go to 1000
857  END IF
858 
859 c 1000 1000 1000 1000 1000 1000 1000 1000 1000 1000 1000 1000 1000 1000
860 
861  200 CONTINUE
862 
863  !call get_par(psi_bnd)
864 
865  diftok=dabs(platok-ztok)/(dabs(platok-ztok_n)+1.d-8)
866  difpsi=dabs(psax-zpsim)/(dabs(psax-zpsim_n)+1.d-8)
867 
868 
869 c print *,' platok ztok=',platok,ztok
870 c print *,' psax zpsim=',psax,zpsim
871 
872 c diftok=dabs(platok-ztok)/(dabs(platok)+1.d-4)
873 c difpsi=dabs(psax-zpsim)/(dabs(psax)+1.d-4)
874 
875 
876  !write(*,*)'***it_dmf',it_dmf !
877  !write(*,*)'diftok=',diftok !
878  !write(*,*)'difpsi=',difpsi !
879 
880  !if(diftok.lt.3.5d-3 .AnD. it_dmf.gt.2) then
881  !if(diftok.lt.5.0d-3 .AnD. difpsi.lt.5.0d-3 .AnD.it_dmf.gt.0) then
882  if(diftok.lt.5.0d-3 .AnD. it_dmf.gt.0) then
883 
884  call eqb( alf0,alf1,alf2, bet0,bet1,bet2, alw0,alw1,alw2,
885  * betplx, i_betp,
886  * keyctr, kstep, platok, rax,zax, b0,r0, psax, igdf,
887  * n_tht, n_psi, epsro, nurs, i_eqdsk,i_bsh,
888  * psi_bnd,psi0_bnd )
889  exit
890 
891  endif
892 
893  ztok = platok
894  zpsim = psax
895 
896  enddo ! it_dmf <<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<
897 !!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!
898 !!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!
899  !print *,'stepon:eqb'
900 
901  ztok_n=platok
902  zpsim_n=psax
903  !print *,'ztok_n',ztok_n
904  !print *,'zpsim_n',zpsim_n
905 !!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!
906 
907 c --- printing of iteration loop accuracy
908 c
909 c IF( keypri.EQ.1 ) THEN
910 c WRITE(nout,*) '_______________________________________'
911 c WRITE(nout,1915) kstep, knel, timev
912 c WRITE(nout,*) 'ERPS =', erps
913 c WRITE(nout,*) 'ERRCU1 =', errcu1,' ERRCU2 =', errcu2
914 c... WRITE(nout,*) 'CURMAX =', curmax,' CURMIN =', curmin
915 c WRITE(nout,*) 'ERRPS1 =', errps1,' ERRPS2 =', errps2
916 c... WRITE(nout,*) 'PSIMAX =', psimax,' PSIMIN =', psimin
917 c WRITE(nout,*) 'DELPS1 =', delps1,' DELPS2 =', delps2
918 c... WRITE(nout,*) 'DELMAX =', delmax,' DELMIN =', delmin
919 c WRITE(nout,*) 'DELAXA =', delaxa,' DELAXR =', delaxr
920 c END IF
921 c
922 c***********************************************************************
923 c poloidal mag. field companents bp_r, bp_z and
924 c poloidal mag. field projection on direction fipro
925 c compute for given "PF_PROBE" points:
926 c
927 c CALL bp_prob( nout, nter, keypri,
928 c * npro, rpro, zpro, fipro,
929 c * brpro2, bzpro2, bpcom2 )
930 c***********************************************************************
931 c compute full poloidal flux in given "loop" points
932 c
933 c CALL fl_loo( nout, nter, keypri,
934 c * nloo, rloo, zloo,
935 c * psloo2 )
936 c***********************************************************************
937 c
938 c..... toroidal currents in passive conductor structures
939 c
940 ! CALL PASCUR( NOUT, NTER, NEQUI, NFW, NBP, NVV,
941 ! * PJKP1, fwcurr, bpcurr, vvcurr )
942  !print *,'stepon:pascur'
943 c-----------------------------------------------------------------------
944 c --- printing
945 c
946  psibou = up
947  psidel = psiout - psibou
948 
949 
950 c
951 cccc include 'printa.inc'
952 c
953 c***********************************************************************
954 c--- time level parameters are written in disk files
955 c
956  !!! include 'wrt2.inc'
957 c***********************************************************************
958  222 CONTINUE
959 c
960  errcu1 = 0.d0
961  errcu2 = 0.d0
962  errps1 = 0.d0
963  errps2 = 0.d0
964  delps1 = 0.d0
965  delps2 = 0.d0
966  ereve = 0.d0
967  erps = 0.d0
968 c
969  raxpr = rm
970  zaxpr = zm
971  ! RXPPR = RX0
972  ! ZXPPR = ZX0
973  kstepr = kstep
974  tstepr = tstep
975 c
976  DO 293 l=1,npfc
977  pfcur1(l) = pfcur2(l)
978  pfcw1(l) = pfcw2(l)
979  pfcd1(l) = pfcd2(l)
980  293 CONTINUE
981 
982  do i=1,nequi
983  d_pf_mat(i) = pjkp1(i)*1.0d6 !!! in [A]
984  enddo
985 
986  camtok=0.d0
987  do i=nequi+1,ncequi
988  d_tcam_mat(i-nequi) = pjkp1(i)*1.0d6 !!! in [A]
989  camtok=camtok+pjkp1(i)
990  enddo
991 
992 
993  DO 260 l=1,ncequi
994  pjk(l) = pjkp1(l)
995  volk(l) = volkp1(l)
996  pskm1(l) = psk(l)
997  psk(l) = pskp1(l)
998  260 CONTINUE
999 c
1000 c***********************************************************************
1001  if(kstep.lt.nstep_p)then
1002  i_tim=kstep
1003 
1004  time_t(i_tim)=time
1005  torcur(i_tim)=platok
1006  rm_t(i_tim)=rax
1007  zm_t(i_tim)=zax
1008  rxp_t(i_tim)=rxpnt
1009  zxp_t(i_tim)=zxpnt
1010  betpol_t(i_tim)=betpol
1011  bettor_t(i_tim)=betful
1012  psim_t(i_tim)=psax
1013  psib_t(i_tim)=psbo
1014  endif
1015 c-----------------------------------------------------------------------
1016 c for writing for "motion picture"
1017 c
1018 c psiplb(kstep)=pspl_av
1019 c psiexb(kstep)=psex_av
1020 c psimag(kstep)=psi0_ax
1021 c flu_tor(kstep)=flx_fi
1022 c
1023 c if(kstep.gt.0 .AnD. kstep.le.2000) then
1024 c kskw=2
1025 c if(kstep/kskw*kskw .eq. kstep) then
1026 c numwr=numwr+1
1027 c call wrdfmv(numwr,timev)
1028 c call wrdump(numwr,timev,kstep,psiplb,psiexb,psimag,flu_tor)
1029 c endif
1030 c endif
1031 c 100 100 100 100 100 100 100 100 100 100 100 100 100 100 100 100
1032 !!!! GO TO 100
1033 c 100 100 100 100 100 100 100 100 100 100 100 100 100 100 100 100
1034 c-----------------------------------------------------------------------
1035  103 FORMAT(2x,8e12.5)
1036  1915 FORMAT(3x,'LEVEL K =',i3,2x,'ITERATION KNEL =',i3,2x,
1037  * 'TIME(K) =',e12.5)
1038 c********************************
1039 
1040 
1041  RETURN
1042  END
1043 
1044 
1045 
1046 
1047 
1048 
1049 
1050 
subroutine sstepon(KLUCH, k_auto, nstep, dt, time,
Definition: sstepon.f:3
subroutine tab_efit(tokf, psax, eqdfn, rax, zax, b0, r0)
Definition: B_wrd.f:447
subroutine zero(x1, y1, x2, y2, func, err, x, y, izero, ll)
Definition: zero.f90:1
subroutine get_par(psi_bnd)
Definition: Eq_m.f:1316
subroutine psib_ext(psex_av)
Definition: B_rig.f:614
subroutine conduc(NC, NCEQUI, NCPFC, NFW, NBP, NVV, RC, ZC, PC, VC, HC, NTYPE, RC1, ZC1, RC2, ZC2, RC3, ZC3, RC4, ZC4, RES, VOLK, VOLKP1, NECON, WECON, NOUT, NTER, NINFW, ngra1)
Definition: Ev1.f:826
subroutine eq_par(z0cen_e, alp_e, alpnew_e, qcen_e, nctrl_e, numlim_e, up_e, rm_e, zm_e, rx0_e, zx0_e)
Definition: Ev1.f:791
subroutine loopnt(NOUT, NTER, NINFW, NGRA1,
Definition: Ev3.f:254
subroutine rd_ppind
Definition: Ev3.f:166
subroutine eq(pcequi, psicon, ncequi, nstep, ngrid,
Definition: Eq_m.f:310
subroutine eqb(alf0, alf1, alf2, bet0, bet1, bet2, alw0, alw1, alw2,
Definition: B_eqb.f:3
subroutine rd_loop(NLOO, RLOO, ZLOO)
Definition: Ev3.f:302
subroutine get_flfi(flfi_m)
Definition: com_sub.f:394
subroutine l_matr(NOUT,NTER, NC, NCPFC,
Definition: Ev3.f:63
subroutine differ(AOLD, ANEW, N, ERRLOC, ERRVEC, ABSMAX, ABSMIN, NOUT, NTER)
Definition: Ev1.f:3
subroutine noauto
Definition: Eq_m.f:105
subroutine flux(psitok, rk, zk, nk)
Definition: EQ1_m.f:786
subroutine auto(rk, zk, tk, nk, nstep, ngrid,
Definition: Eq_m.f:2
subroutine out42(n, a, m, b)
Definition: out42_dummy.f:27
subroutine eq_ax(pcequi, psicon, ncequi, nstep, ngrid,
Definition: Eq_m.f:756
subroutine wrb
Definition: B_wrd.f:1
subroutine bongri
Definition: com_sub.f:242
subroutine wrcoil(nk, nkcoil, rk, zk, tk, necon, wecon)
Definition: wrc.f:1
subroutine loop
Definition: Eq2_m.f:231
subroutine fl_loo(NOUT, NTER, KEYPRI, NLOO, RLOO, ZLOO, PSLOO)
Definition: Ev2.f:268
subroutine psib_pla(pspl_av)
Definition: B_rig.f:499
subroutine evslv(NLES, NREG, TSTEP0, TSTEP, SIGM, NJ, VOLK, VOLKP1, RES, PSPK, PSPKP1, CRPK, CRPKP1, CRPKP, NOUT, NTER, KEYPRI, EREVE)
Definition: solc.f:22
subroutine wrdfmv(numwr, time)
Definition: Eq2_m.f:1480
subroutine eq_0(pcequi, psitok, ncequi, nstep, ngrid,
Definition: Eq_m.f:148
subroutine evolution(T, R_in, R_out, El, Tr_l, Tr_U, Ip)
subroutine bp_prob(NOUT, NTER, KEYPRI, NPRO, RPRO, ZPRO, FIPRO, BRPRO, BZPRO, BPCOM)
Definition: Ev2.f:192
subroutine propnt(NOUT, NTER, NINFW, NGRA1,
Definition: Ev3.f:187
subroutine rd_prob(NPRO, RPRO, ZPRO, FIPRO)
Definition: Ev3.f:233
subroutine rdexf(ncequi)
Definition: EQ1_m.f:509
subroutine wrdump(numwr, time, istep, psiplb, psiexb, psimag, flu_tor)
Definition: B_wrd.f:383
subroutine pau()
Definition: Spider_call.f:229
subroutine matrix
Definition: Matrix.f:2