*$ CREATE MGDRAW.FOR *COPY MGDRAW * * *=== mgdraw ===========================================================* * * SUBROUTINE MGDRAW ( ICODE, MREG ) INCLUDE '(DBLPRC)' INCLUDE '(DIMPAR)' INCLUDE '(IOUNIT)' * *----------------------------------------------------------------------* * * * Copyright (C) 1990-2006 by Alfredo Ferrari * * All Rights Reserved. * * * * * * MaGnetic field trajectory DRAWing: actually this entry manages * * all trajectory dumping for * * drawing * * * * Created on 01 march 1990 by Alfredo Ferrari * * INFN - Milan * * Last change 05-may-06 by Alfredo Ferrari * * INFN - Milan * * * *----------------------------------------------------------------------* * INCLUDE '(CASLIM)' INCLUDE '(COMPUT)' INCLUDE '(SOURCM)' INCLUDE '(FHEAVY)' INCLUDE '(FLKSTK)' INCLUDE '(GENSTK)' INCLUDE '(MGDDCM)' INCLUDE '(PAPROP)' INCLUDE '(QUEMGD)' INCLUDE '(SUMCOU)' INCLUDE '(TRACKR)' * DIMENSION DTQUEN ( MXTRCK, MAXQMG ) * CHARACTER*20 FILNAM LOGICAL LFCOPE SAVE LFCOPE DATA LFCOPE / .FALSE. / * logical myfrst, fiopen, istat character currun*3, fname*40 character*8 names(10) integer paw(512000) integer in_ntuple, out_ntuple real*4 xtup(10) common /pawc/ paw common /pextra/ xtup, nevt, ntpevent, in_ntuple, out_ntuple common /cycles/ mbegin, mend, mdoing, mmpart, nsourc, 1 fiopen, currun common /quest/ iquest(100) data myfrst /.true./, fiopen /.false./ data names /'Ncase', 'IDpart', 'Age', 'Xpart', 'Ypart', 1 'Zpart', 'PX', 'PY', 'PZ', 'Wpart'/ save myfrst,zlow,zmax save ngamm,nelec,nprot * *----------------------------------------------------------------------* * * * Icode = 1: call from Kaskad * * Icode = 2: call from Emfsco * * Icode = 3: call from Kasneu * * Icode = 4: call from Kashea * * Icode = 5: call from Kasoph * * * *----------------------------------------------------------------------* * * IF ( .NOT. LFCOPE ) THEN LFCOPE = .TRUE. IF ( KOMPUT .EQ. 2 ) THEN FILNAM = '/'//CFDRAW(1:8)//' DUMP A' ELSE FILNAM = CFDRAW END IF c OPEN ( UNIT = IODRAW, FILE = FILNAM, STATUS = 'NEW', FORM = c & 'UNFORMATTED' ) END IF c WRITE (IODRAW) NTRACK, MTRACK, JTRACK, SNGL (ETRACK), c & SNGL (WTRACK) c WRITE (IODRAW) ( SNGL (XTRACK (I)), SNGL (YTRACK (I)), c & SNGL (ZTRACK (I)), I = 0, NTRACK ), c & ( SNGL (DTRACK (I)), I = 1, MTRACK ), c & SNGL (CTRACK) * +-------------------------------------------------------------------* * | Quenching is activated IF ( LQEMGD ) THEN RULLL = ZERZER CALL QUENMG ( ICODE, MREG, RULLL, DTQUEN ) c WRITE (IODRAW) ( ( SNGL (DTQUEN (I,JBK)), I = 1, MTRACK ), c & JBK = 1, NQEMGD ) END IF * | End of quenching * +-------------------------------------------------------------------* RETURN * *======================================================================* * * * Boundary-(X)crossing DRAWing: * * * * Icode = 1x: call from Kaskad * * 19: boundary crossing * * Icode = 2x: call from Emfsco * * 29: boundary crossing * * Icode = 3x: call from Kasneu * * 39: boundary crossing * * Icode = 4x: call from Kashea * * 49: boundary crossing * * Icode = 5x: call from Kasoph * * 59: boundary crossing * * * *======================================================================* * * ENTRY BXDRAW ( ICODE, MREG, NEWREG, XSCO, YSCO, ZSCO ) if (myfrst) then ngamm = 0 nelec = 0 nprot = 0 * Call HBOOK initialization c call hlimit(512000) c iquest(10) = 65000 out_ntuple = 1 fname = 'pt30'//currun//'.hbook' lennam = index(fname,' ')-1 c open(unit=49,file=fname(1:lennam),status='unknown') c call hropen(49,'FLUKA',fname(1:lennam),'N',1024,istat) c if (istat) then c write(11,*) 'File ',fname,' could not be opened. Stop.' c stop c endif c fiopen = .true. c call hcdir('//FLUKA', ' ') c call hbookn(out_ntuple,'pt30',10,'FLUKA',1024,names) myfrst = .false. endif * if ((mreg.eq.3).and.(newreg.eq.2)) then * write(49,*) 'BXDRAW:',ncase,icode,mreg,newreg,xsco,ysco,zsco,atrack * write(49,*) npsoev,(nevent(i),i=1,5) * write(49,*) ntrack,mtrack,jtrack,etrack,cxtrck,cytrck,cztrck,wtrack asupx=ptrack*cxtrck asupy=ptrack*cytrck asupz=ptrack*cztrck if ((jtrack.ge.1).and.(jtrack.le.25)) then if ((jtrack.eq.1).or. & ((jtrack.ge.13).and.(jtrack.le.16))) then if ((ptrack.lt.0.420).or.(ptrack.gt.0.580)) go to 50 if (abs(asupx/ptrack).gt.0.25) go to 50 if (abs(asupy/ptrack).gt.0.05) go to 50 write(49,10) ncase,jtrack,atrack,xsco,ysco,zsco & ,asupx,asupy,asupz,wtrack 10 format(i8,i4,1pe13.5,3(0pf12.6),3(1pe14.5),0pf5.1) c xtup(1) = ncase c xtup(2) = jtrack c xtup(3) = atrack c xtup(4) = xsco c xtup(5) = ysco c xtup(6) = zsco c xtup(7) = asupx c xtup(8) = asupy c xtup(9) = asupz c xtup(10) = wtrack c call hfn(out_ntuple,xtup) endif endif 40 continue endif 50 continue RETURN * *======================================================================* * * * Event End DRAWing: * * * *======================================================================* * * ENTRY EEDRAW ( ICODE ) RETURN * *======================================================================* * * * ENergy deposition DRAWing: * * * * Icode = 1x: call from Kaskad * * 10: elastic interaction recoil * * 11: inelastic interaction recoil * * 12: stopping particle * * 13: pseudo-neutron deposition * * 14: escape * * 15: time kill * * Icode = 2x: call from Emfsco * * 20: local energy deposition (i.e. photoelectric) * * 21: below threshold, iarg=1 * * 22: below threshold, iarg=2 * * 23: escape * * 24: time kill * * Icode = 3x: call from Kasneu * * 30: target recoil * * 31: below threshold * * 32: escape * * 33: time kill * * Icode = 4x: call from Kashea * * 40: escape * * 41: time kill * * 42: delta ray stack overflow * * Icode = 5x: call from Kasoph * * 50: optical photon absorption * * 51: escape * * 52: time kill * * * *======================================================================* * * ENTRY ENDRAW ( ICODE, MREG, RULL, XSCO, YSCO, ZSCO ) IF ( .NOT. LFCOPE ) THEN LFCOPE = .TRUE. IF ( KOMPUT .EQ. 2 ) THEN FILNAM = '/'//CFDRAW(1:8)//' DUMP A' ELSE FILNAM = CFDRAW END IF c OPEN ( UNIT = IODRAW, FILE = FILNAM, STATUS = 'NEW', FORM = c & 'UNFORMATTED' ) END IF c WRITE (IODRAW) 0, ICODE, JTRACK, SNGL (ETRACK), SNGL (WTRACK) c WRITE (IODRAW) SNGL (XSCO), SNGL (YSCO), SNGL (ZSCO), SNGL (RULL) * +-------------------------------------------------------------------* * | Quenching is activated : calculate quenching factor * | and store quenched energy in DTQUEN(1, jbk) IF ( LQEMGD ) THEN RULLL = RULL CALL QUENMG ( ICODE, MREG, RULLL, DTQUEN ) c WRITE (IODRAW) ( SNGL (DTQUEN(1, JBK)), JBK = 1, NQEMGD ) END IF * | end quenching * +-------------------------------------------------------------------* RETURN * *======================================================================* * * * SOurce particle DRAWing: * * * *======================================================================* * ENTRY SODRAW IF ( .NOT. LFCOPE ) THEN LFCOPE = .TRUE. IF ( KOMPUT .EQ. 2 ) THEN FILNAM = '/'//CFDRAW(1:8)//' DUMP A' ELSE FILNAM = CFDRAW END IF c OPEN ( UNIT = IODRAW, FILE = FILNAM, STATUS = 'NEW', FORM = c & 'UNFORMATTED' ) END IF c WRITE (IODRAW) -NCASE, NPFLKA, NSTMAX, SNGL (TKESUM), c & SNGL (WEIPRI) * +-------------------------------------------------------------------* * | (Radioactive) isotope: it works only for 1 source particle on * | the stack for the time being IF ( ILOFLK (NPFLKA) .GE. 100000 .AND. LRADDC (NPFLKA) ) THEN IARES = MOD ( ILOFLK (NPFLKA), 100000 ) / 100 IZRES = MOD ( ILOFLK (NPFLKA), 10000000 ) / 100000 IISRES = ILOFLK (NPFLKA) / 10000000 IONID = ILOFLK (NPFLKA) c WRITE (IODRAW) ( IONID,SNGL(-TKEFLK(I)), c & SNGL (WTFLK(I)), SNGL (XFLK (I)), c & SNGL (YFLK (I)), SNGL (ZFLK (I)), c & SNGL (TXFLK(I)), SNGL (TYFLK(I)), c & SNGL (TZFLK(I)), I = 1, NPFLKA ) * | * +-------------------------------------------------------------------* * | Patch for heavy ions: it works only for 1 source particle on * | the stack for the time being ELSE IF ( ABS (ILOFLK (NPFLKA)) .GE. 10000 ) THEN IONID = ILOFLK (NPFLKA) CALL DCDION ( IONID ) c WRITE (IODRAW) ( IONID,SNGL(TKEFLK(I)+AMNHEA(-IONID)), c & SNGL (WTFLK(I)), SNGL (XFLK (I)), c & SNGL (YFLK (I)), SNGL (ZFLK (I)), c & SNGL (TXFLK(I)), SNGL (TYFLK(I)), c & SNGL (TZFLK(I)), I = 1, NPFLKA ) * | * +-------------------------------------------------------------------* * | Patch for heavy ions: ??? ELSE IF ( ILOFLK (NPFLKA) .LT. -6 ) THEN c WRITE (IODRAW) ( IONID,SNGL(TKEFLK(I)+AMNHEA(-ILOFLK(NPFLKA))), c & SNGL (WTFLK(I)), SNGL (XFLK (I)), c & SNGL (YFLK (I)), SNGL (ZFLK (I)), c & SNGL (TXFLK(I)), SNGL (TYFLK(I)), c & SNGL (TZFLK(I)), I = 1, NPFLKA ) * | * +-------------------------------------------------------------------* * | ELSE c WRITE (IODRAW) ( ILOFLK(I), SNGL (TKEFLK(I)+AM(ILOFLK(I))), c & SNGL (WTFLK(I)), SNGL (XFLK (I)), c & SNGL (YFLK (I)), SNGL (ZFLK (I)), c & SNGL (TXFLK(I)), SNGL (TYFLK(I)), c & SNGL (TZFLK(I)), I = 1, NPFLKA ) END IF * | * +-------------------------------------------------------------------* RETURN * *======================================================================* * * * USer dependent DRAWing: * * * * Icode = 10x: call from Kaskad * * 100: elastic interaction secondaries * * 101: inelastic interaction secondaries * * 102: particle decay secondaries * * 103: delta ray generation secondaries * * 104: pair production secondaries * * 105: bremsstrahlung secondaries * * 110: decay products * * Icode = 20x: call from Emfsco * * 208: bremsstrahlung secondaries * * 210: Moller secondaries * * 212: Bhabha secondaries * * 214: in-flight annihilation secondaries * * 215: annihilation at rest secondaries * * 217: pair production secondaries * * 219: Compton scattering secondaries * * 221: photoelectric secondaries * * 225: Rayleigh scattering secondaries * * Icode = 30x: call from Kasneu * * 300: interaction secondaries * * Icode = 40x: call from Kashea * * 400: delta ray generation secondaries * * For all interactions secondaries are put on GENSTK common (kp=1,np) * * but for KASHEA delta ray generation where only the secondary elec- * * tron is present and stacked on FLKSTK common for kp=npflka * * * *======================================================================* * ENTRY USDRAW ( ICODE, MREG, XSCO, YSCO, ZSCO ) IF ( .NOT. LFCOPE ) THEN LFCOPE = .TRUE. IF ( KOMPUT .EQ. 2 ) THEN FILNAM = '/'//CFDRAW(1:8)//' DUMP A' ELSE FILNAM = CFDRAW END IF c OPEN ( UNIT = IODRAW, FILE = FILNAM, STATUS = 'NEW', FORM = c & 'UNFORMATTED' ) END IF * No output by default: RETURN *=== End of subrutine Mgdraw ==========================================* END