diff --git a/doc/user_manual/chSpecialElements.tex b/doc/user_manual/chSpecialElements.tex index 6b6b78c33..36777b782 100644 --- a/doc/user_manual/chSpecialElements.tex +++ b/doc/user_manual/chSpecialElements.tex @@ -1884,6 +1884,7 @@ \subsection{Collimation Input Block} \label{sec:coll:input} \texttt{WRITE\_IMPACT} & Writes the impact parameters for each collimator. \\ \texttt{WRITE\_SECOND} & Writes a secondary halo file based on normalised amplitude. \\ \texttt{WRITE\_AMPL} & Writes checking files for amplitude, closed orbit. \\ + \texttt{WRITE\_EFFIC} & Writes the efficiency files. \\ \texttt{WRITE\_TRACKS} & Writes secondary/tertiary halo files. \end{tabular} @@ -2124,25 +2125,25 @@ \subsection{Old Input Format}\label{sec:coll:oldfmt} \bigskip \begin{cverbatim} -COLLIMATION---------------------------------------------------------------- - .true. - 50 7000000 - 3 5 .958 .0015 0. 0. "nothing" 1. 129e-4 75.5 - .true. 15. 18. 18. 20. 6. 7. 7. 10.0 1 0.0 999.0 8.0 7.5 999.0 - 8.3 8.3 8.3 8.3 8.3 8.3 8.3 8.3 5. 15. - 0 19789.0 20150.0 1 1 - -1.3899e-6 -9.345e-5 5.05324e-3 -1.6595e-2 2.15955e-2 -9.96261e-3 1.0 - -1.3899e-6 -9.345e-5 5.05324e-3 -1.6595e-2 2.15955e-2 -9.96261e-3 1.0 - 0.503E-09 0.503E-09 - .false. .false. 0 .true. TCP.C6L7.B1 .false. .true. .true. .true. - 0. 0. 0. 0. +COLLIMATION + .true. + 50 7000000 + 3 5 0.958 0.0015 0.0 0.0 "nothing" 1.0 129e-4 75.5 + .true. 15.0 18.0 18.0 20.0 6.0 7.0 7.0 10.0 1 0.0 999.0 8.0 7.5 999.0 + 8.3 8.3 8.3 8.3 8.3 8.3 8.3 8.3 5.0 15.0 + 0 19789.0 20150.0 1 1 + -1.3899e-6 -9.345e-5 5.05324e-3 -1.6595e-2 2.15955e-2 -9.96261e-3 1.0 + -1.3899e-6 -9.345e-5 5.05324e-3 -1.6595e-2 2.15955e-2 -9.96261e-3 1.0 + 0.503E-09 0.503E-09 + .false. .false. 0 .true. TCP.C6L7.B1 .false. .true. .true. .true. .true. + 0.0 0.0 0.0 0.0 0 0 0 0 0 0 0 0 0 0 .false. - .false. 6.003 0.0015 - 0. 0. .false. .false. + .false. 6.003 0.0015 + 0.0 0.0 .false. .false. 0 0.0025 0.0 0.0 0 "CollDB_V6.500_lowb_st.b1.data" 1 .true. .false. WAbsVertLowbcoll 101 1 1. -NEXT----------------------------------------------------------------------------- +NEXT \end{cverbatim} \paragraph{Old Collimator Database Format}~\\ @@ -2335,6 +2336,8 @@ \subsection{Old Input Format}\label{sec:coll:oldfmt} & \texttt{DOWRT\_SECOND} & logical & Writes a secondary halo file based on normalised amplitude. \\ \cline{2-4} & \texttt{DOWRT\_AMPL} & logical & Writes checking files for amplitude, closed orbit. \\ + \cline{2-4} + & \texttt{DOWRT\_EFFIC} & logical & Writes the efficiency files. \\ \hline 11 & \texttt{XBEAT} & float & Offset in $x$ for the computation of collimator in case of beta-beating\index{beta-beating}. \\ diff --git a/source/coll_common.f90 b/source/coll_common.f90 index 98b279b1c..c0b19528e 100644 --- a/source/coll_common.f90 +++ b/source/coll_common.f90 @@ -8,17 +8,16 @@ module coll_common implicit none - integer, parameter :: max_ncoll = 100 - ! Logical Flags - logical, save :: coll_debug = .true. - logical, save :: dowrite_impact = .false. - logical, save :: dowrite_dist = .false. - logical, save :: dowrite_secondary = .false. - logical, save :: dowrite_amplitude = .false. - logical, save :: dowritetracks = .false. - logical, save :: dowrite_crycoord = .false. - logical, save :: coll_hasCrystal = .false. + logical, save :: coll_debug = .true. + logical, save :: dowrite_impact = .false. + logical, save :: dowrite_dist = .false. + logical, save :: dowrite_secondary = .false. + logical, save :: dowrite_amplitude = .false. + logical, save :: dowrite_tracks = .false. + logical, save :: dowrite_efficiency = .false. + logical, save :: dowrite_crycoord = .false. + logical, save :: coll_hasCrystal = .false. ! Various Variables integer, save :: rnd_seed = 0 @@ -44,8 +43,19 @@ module coll_common real(kind=fPrec), save :: yp_pencil0 = zero real(kind=fPrec), allocatable, save :: x_pencil(:) real(kind=fPrec), allocatable, save :: y_pencil(:) + real(kind=fPrec), allocatable, save :: xp_pencil(:) + real(kind=fPrec), allocatable, save :: yp_pencil(:) real(kind=fPrec), allocatable, save :: pencil_dx(:) + ! Other Arrays + integer, allocatable, save :: cn_impact(:) + integer, allocatable, save :: cn_absorbed(:) + real(kind=fPrec), allocatable, save :: caverage(:) + real(kind=fPrec), allocatable, save :: csigma(:) + real(kind=fPrec), allocatable, save :: gap_rms_error(:) + real(kind=fPrec), allocatable, save :: csum(:) + real(kind=fPrec), allocatable, save :: csqsum(:) + ! Output File Names character(len=12), parameter :: coll_survivalFile = "survival.dat" character(len=12), parameter :: coll_gapsFile = "collgaps.dat" @@ -60,7 +70,6 @@ module coll_common character(len=16), parameter :: coll_fstImpactFile = "FirstImpacts.dat" character(len=17), parameter :: coll_flukImpFile = "FLUKA_impacts.dat" character(len=21), parameter :: coll_flukImpAllFile = "FLUKA_impacts_all.dat" - character(len=13), parameter :: coll_twissLikeFile = "twisslike.out" character(len=17), parameter :: coll_sigmaSetFile = "sigmasettings.out" character(len=16), parameter :: coll_settingsFile = "collsettings.dat" character(len=16), parameter :: coll_jawProfileFile = "jaw_profiles.dat" @@ -89,7 +98,6 @@ module coll_common integer, save :: coll_fstImpactUnit = -1 integer, save :: coll_flukImpUnit = -1 integer, save :: coll_flukImpAllUnit = -1 - integer, save :: coll_twissLikeUnit = -1 integer, save :: coll_sigmaSetUnit = -1 integer, save :: coll_settingsUnit = -1 integer, save :: coll_jawProfileUnit = -1 @@ -131,12 +139,30 @@ subroutine coll_expandArrays(npart_new, nblz_new) call alloc(cry_proc, npart_new, -1, "cry_proc") - call alloc(x_pencil, max_ncoll, zero, "x_pencil") - call alloc(y_pencil, max_ncoll, zero, "y_pencil") - call alloc(pencil_dx, max_ncoll, zero, "pencil_dx") - end subroutine coll_expandArrays +subroutine coll_expandNColl(nColl) + + use mod_alloc + use numerical_constants + + integer, intent(in) :: nColl + + call alloc(cn_impact, nColl, 0, "cn_impact") + call alloc(cn_absorbed, nColl, 0, "cn_absorbed") + call alloc(caverage, nColl, zero, "caverage") + call alloc(csigma, nColl, zero, "csigma") + call alloc(gap_rms_error, nColl, zero, "gap_rms_error") + call alloc(csum, nColl, zero, "csum") + call alloc(csqsum, nColl, zero, "csqsum") + call alloc(x_pencil, nColl, zero, "x_pencil") + call alloc(y_pencil, nColl, zero, "y_pencil") + call alloc(xp_pencil, nColl, zero, "xp_pencil") + call alloc(yp_pencil, nColl, zero, "yp_pencil") + call alloc(pencil_dx, nColl, zero, "pencil_dx") + +end subroutine coll_expandNColl + end module coll_common ! ================================================================================================ ! diff --git a/source/coll_db.f90 b/source/coll_db.f90 index f9bd4a8e2..dccd2f46d 100644 --- a/source/coll_db.f90 +++ b/source/coll_db.f90 @@ -72,6 +72,7 @@ module coll_db ! Element Map integer, allocatable, public, save :: cdb_elemMap(:) ! Map from single elements to DB + integer, allocatable, public, save :: cdb_struMap(:) ! Map from collimator to structure index contains @@ -100,6 +101,7 @@ subroutine cdb_allocDB call alloc(cdb_cBx, cdb_nColl, zero, "cdb_cBx") call alloc(cdb_cBy, cdb_nColl, zero, "cdb_cBy") call alloc(cdb_cFound, cdb_nColl, .false., "cdb_cFound") + call alloc(cdb_struMap, cdb_nColl, 0, "cdb_struMap") ! Additional Settings Arrays call alloc(cdb_cTilt, 2, cdb_nColl, zero, "cdb_cTilt") @@ -163,6 +165,7 @@ subroutine cdb_readCollDB use mod_common use mod_settings use string_tools + use coll_common character(len=:), allocatable :: lnSplit(:) character(len=mInputLn) inLine @@ -202,6 +205,9 @@ subroutine cdb_readCollDB call cdb_readDB_newFormat end if + ! Now we know how many collimators we have, so allocate remaining arrays + call coll_expandNColl(cdb_nColl) + if(cdb_setPos > 0) then ! The DB has additional SETTINGS, parse them call cdb_readDBSettings @@ -233,7 +239,7 @@ subroutine cdb_readCollDB end do end if - ! Map single elements to collimators + ! Map single elements to collimators and collimators to structure elements do i=1,iu ix = ic(i)-nblo if(ix < 1) cycle @@ -247,15 +253,18 @@ subroutine cdb_readCollDB end do if(collID == -1) then - if(bez(ix)(1:2) == "tc" .or. bez(ix)(1:2) == "td" .or. bez(ix)(1:3) == "col") then + ! This warning is just for backwards compatibility with the old collimation module which + ! expected the collimators to follow the LHC or RHIC naming convention. + if(bez(ix)(1:2) == "tc" .or. bez(ix)(1:2) == "td" .or. bez(ix)(1:3) == "col" .or. bez(ix)(1:3) == "cry") then elemEnd = len_trim(bez(ix)) - if(bez(ix)(elemEnd-2:elemEnd) /= "_AP") then - write(lout,"(a)") "COLLDB> WARNING Collimator not found in database: '"//trim(bez(ix))//"'" + if(bez(ix)(elemEnd-2:elemEnd) /= "_AP") then ! Don't warn on Mad-X aperture markers + write(lout,"(a)") "COLLDB> WARNING Collimator with LHC or RHIC style name not found in database: '"//trim(bez(ix))//"'" end if end if else - cdb_elemMap(ix) = collID - cdb_cFound(collID) = .true. + cdb_elemMap(ix) = collID + cdb_struMap(collID) = i + cdb_cFound(collID) = .true. end if end do diff --git a/source/coll_dist.f90 b/source/coll_dist.f90 index 81a627e21..253a669e3 100644 --- a/source/coll_dist.f90 +++ b/source/coll_dist.f90 @@ -38,6 +38,35 @@ module coll_dist contains +! ================================================================================================ ! +! V.K. Berglyd Olsen, BE-ABP-HSS +! Created: 2019-10-21 +! Updated: 2019-10-21 +! Initialise the parameters needed for generating distributions +! ================================================================================================ ! +subroutine cdist_init(enom,emitx0_dist,emity0_dist,emitx0_gap,emity0_gap) + + use mod_common_track + + real(kind=fPrec), intent(in) :: enom + real(kind=fPrec), intent(in) :: emitx0_dist + real(kind=fPrec), intent(in) :: emity0_dist + real(kind=fPrec), intent(in) :: emitx0_gap + real(kind=fPrec), intent(in) :: emity0_gap + + cdist_energy = enom + cdist_emitX = emitx0_dist + cdist_emitY = emity0_dist + cdist_emitXColl = emitx0_gap + cdist_emitYColl = emity0_gap + + cdist_alphaX = talphax(1) + cdist_alphaY = talphay(1) + cdist_betaX = tbetax(1) + cdist_betaY = tbetay(1) + +end subroutine cdist_init + ! ================================================================================================ ! ! V.K. Berglyd Olsen, BE-ABP-HSS ! Created: 2019-03-26 diff --git a/source/collimation.f90 b/source/collimation.f90 index ede4fa8f3..ca5aa5a14 100644 --- a/source/collimation.f90 +++ b/source/collimation.f90 @@ -7,7 +7,7 @@ ! Y.I. Levinsen, C. Tambasco, J. Molson, K.N. Sjobak, V.K. Berglyd Olsen ! ! Created: 2004-10-27 -! Updated: 2019-09-12 +! Updated: 2019-10-21 ! ! ================================================================================================ ! module collimation @@ -15,30 +15,30 @@ module collimation use parpro use floatPrecision use numerical_constants - use coll_common, only : max_ncoll implicit none integer, parameter :: numeff = 32 integer, parameter :: numeffdpop = 29 - integer, parameter :: nc = 32 ! Logical Flags logical, public, save :: do_coll = .false. - logical, public, save :: coll_oldBlock = .false. + logical, private, save :: coll_oldBlock = .false. logical, private, save :: do_select = .false. logical, private, save :: do_nominal = .false. logical, private, save :: do_oneside = .false. logical, private, save :: systilt_antisymm = .false. logical, private, save :: do_mingap = .false. + logical, private, save :: firstcoll = .true. - integer, private, save :: icoll = 0 - integer, private, save :: ie = 0 - integer, private, save :: iturn = 0 + integer, private, save :: icoll = 0 + integer, private, save :: ie = 1 + integer, private, save :: iturn = 1 + integer, private, save :: c_ix = 0 ! Distribution integer, private, save :: do_thisdis = 0 - real(kind=fPrec), public, save :: myenom = zero + real(kind=fPrec), private, save :: c_enom = zero logical, private, save :: radial = .false. ! Jaw Slicing @@ -74,296 +74,220 @@ module collimation real(kind=fPrec), private, save :: sigsecut3 = one real(kind=fPrec), private, save :: sigsecut2 = one - real(kind=fPrec), private, save :: emitnx0_dist = zero - real(kind=fPrec), private, save :: emitny0_dist = zero + ! Normalised emittances from input + real(kind=fPrec), private, save :: emitnx0_dist = zero + real(kind=fPrec), private, save :: emitny0_dist = zero real(kind=fPrec), private, save :: emitnx0_collgap = zero real(kind=fPrec), private, save :: emitny0_collgap = zero - character(len=mNameLen), private, save :: name_sel = " " - - integer ieff,ieffdpop + ! Geometric emittances + real(kind=fPrec), private, save :: c_emitx0_dist = zero + real(kind=fPrec), private, save :: c_emity0_dist = zero + real(kind=fPrec), private, save :: c_emitx0_collgap = zero + real(kind=fPrec), private, save :: c_emity0_collgap = zero - real(kind=fPrec), private, save :: myemitx0_dist = zero - real(kind=fPrec), private, save :: myemity0_dist = zero - real(kind=fPrec), public, save :: myemitx0_collgap = zero - real(kind=fPrec), public, save :: myemity0_collgap = zero - - real(kind=fPrec), private, save :: myalphay - real(kind=fPrec), private, save :: mybetay - real(kind=fPrec), private, save :: myalphax - real(kind=fPrec), private, save :: mybetax - real(kind=fPrec), private, save :: myemitx + character(len=mNameLen), private, save :: name_sel = " " ! M. Fiascaris for the collimation team - ! variables for global inefficiencies studies - ! of normalized and off-momentum halo - ! Last modified: July 2016 - - real(kind=fPrec), allocatable, save :: neff(:) !(numeff) - real(kind=fPrec), allocatable, save :: rsig(:) !(numeff) - - integer, allocatable, save :: counteddpop(:,:) !(npart,numeffdpop) - integer, allocatable, save :: npartdpop(:) !(numeffdpop) - integer, allocatable, save :: counted2d(:,:,:) !(npart,numeff,numeffdpop) - real(kind=fPrec), allocatable, save :: neffdpop(:) !(numeffdpop) - real(kind=fPrec), allocatable, save :: dpopbins(:) !(numeffdpop) - - real(kind=fPrec) dpopmin,dpopmax,mydpop - real(kind=fPrec), allocatable, save :: neff2d(:,:) !(numeff,numeffdpop) - - integer, allocatable, save :: nimpact(:) !(50) - real(kind=fPrec), allocatable, save :: sumimpact(:) !(50) - real(kind=fPrec), allocatable, save :: sqsumimpact(:) !(50) - - integer, allocatable, save :: nampl(:) !(nblz) - real(kind=fPrec), allocatable, save :: sum_ax(:) !(nblz) - real(kind=fPrec), allocatable, save :: sqsum_ax(:) !(nblz) - real(kind=fPrec), allocatable, save :: sum_ay(:) !(nblz) - real(kind=fPrec), allocatable, save :: sqsum_ay(:) !(nblz) - - real(kind=fPrec), allocatable, save :: neffx(:) !(numeff) - real(kind=fPrec), allocatable, save :: neffy(:) !(numeff) - - integer, allocatable, save :: part_hit_before_pos(:) !(npart) - integer, allocatable, save :: part_hit_before_turn(:) !(npart) - - real(kind=fPrec), allocatable, save :: part_indiv(:) !(npart) - real(kind=fPrec), allocatable, save :: part_linteract(:) !(npart) - - integer, allocatable, save :: part_hit_pos(:) !(npart) - integer, allocatable, save :: part_hit_turn(:) !(npart) - integer, allocatable, save :: part_abs_pos(:) !(npart) - integer, allocatable, save :: part_abs_turn(:) !(npart) - integer, allocatable, save :: part_select(:) !(npart) - integer, allocatable, save :: nabs_type(:) !(npart) - integer, allocatable, save :: nhit_stage(:) !(npart) - integer, save :: n_tot_absorbed - integer, save :: n_absorbed - integer, save :: nabs_total - - real(kind=fPrec), allocatable, save :: part_impact(:) !(npart) - - integer, save :: nsurvive, nsurvive_end, num_selhit, n_impact - - integer, allocatable, save :: cn_impact(:) !(max_ncoll) - integer, allocatable, save :: cn_absorbed(:) !(max_ncoll) - real(kind=fPrec), allocatable, save :: caverage(:) !(max_ncoll) - real(kind=fPrec), allocatable, save :: csigma(:) !(max_ncoll) - - integer, allocatable, save :: counted_r(:,:) !(npart,numeff) - integer, allocatable, save :: counted_x(:,:) !(npart,numeff) - integer, allocatable, save :: counted_y(:,:) !(npart,numeff) - - character(len=4), save :: smpl - character(len=80), save :: pfile - - ! Variables for finding the collimator with the smallest gap - ! and defining, stroring the gap rms error - - character(len=mNameLen) :: coll_mingap2 - real(kind=fPrec), allocatable, save :: gap_rms_error(:) !(max_ncoll) - real(kind=fPrec) :: nsig_err, sig_offset - real(kind=fPrec) :: mingap, gap_h1, gap_h2, gap_h3, gap_h4 - integer :: coll_mingap_id - - real(kind=fPrec), save :: remitx_dist,remity_dist,remitx_collgap,remity_collgap - - logical, save :: firstcoll - integer rnd_lux,rnd_k1,rnd_k2 - - integer, save :: myix - - real(kind=fPrec), public :: nspx,nspy,mux0,muy0 - real(kind=fPrec), private :: ax0,ay0,bx0,by0 ! These are set, but never used - - real(kind=fPrec), allocatable, save :: xbob(:) !(nblz) - real(kind=fPrec), allocatable, save :: ybob(:) !(nblz) - real(kind=fPrec), allocatable, save :: xpbob(:) !(nblz) - real(kind=fPrec), allocatable, save :: ypbob(:) !(nblz) - - real(kind=fPrec), allocatable, save :: xineff(:) !(npart) - real(kind=fPrec), allocatable, save :: yineff(:) !(npart) - real(kind=fPrec), allocatable, save :: xpineff(:) !(npart) - real(kind=fPrec), allocatable, save :: ypineff(:) !(npart) - - real(kind=fPrec), allocatable, save :: mux(:) !(nblz) - real(kind=fPrec), allocatable, save :: muy(:) !(nblz) - - integer, save :: num_surhit - integer, save :: numbin - integer, save :: ibin - integer, save :: num_selabs - integer, save :: iturn_last_hit - integer, save :: iturn_absorbed - integer, save :: iturn_survive - integer, save :: totalelem - integer, save :: selelem - integer, save :: unitnumber - integer, save :: distnumber - integer, save :: turnnumber - - real(kind=fPrec), save :: c_length !length in m - real(kind=fPrec), save :: c_rotation !rotation angle vs vertical in radian - real(kind=fPrec), save :: c_aperture !aperture in m - real(kind=fPrec), save :: c_offset !offset in m - real(kind=fPrec), save :: c_tilt(2) !tilt in radian - character(len=4), save :: c_material !material - - real(kind=fPrec), allocatable, private, save :: rcx0(:) !(npart) - real(kind=fPrec), allocatable, private, save :: rcxp0(:) !(npart) - real(kind=fPrec), allocatable, private, save :: rcy0(:) !(npart) - real(kind=fPrec), allocatable, private, save :: rcyp0(:) !(npart) - real(kind=fPrec), allocatable, private, save :: rcp0(:) !(npart) - - real(kind=fPrec), private, save :: xj, xpj, yj, ypj, pj - - real(kind=fPrec), save :: enom_gev,betax,betay,xmax,ymax - real(kind=fPrec), save :: nsig,calc_aperture,gammax,gammay,gammax0,gammay0,gammax1,gammay1 - real(kind=fPrec), save :: arcdx,arcbetax,xdisp,rxjco,ryjco - real(kind=fPrec), save :: rxpjco,rypjco,c_rmstilt,c_systilt - real(kind=fPrec), save :: scale_bx, scale_by, scale_bx0, scale_by0, xkick, ykick, bx_dist, by_dist - real(kind=fPrec), save :: xmax_pencil, ymax_pencil, xmax_nom, ymax_nom, nom_aperture, pencil_aperture - - real(kind=fPrec), allocatable, save :: xp_pencil(:) !(max_ncoll) - real(kind=fPrec), allocatable, save :: yp_pencil(:) !(max_ncoll) - real(kind=fPrec), allocatable, save :: csum(:) !(max_ncoll) - real(kind=fPrec), allocatable, save :: csqsum(:) !(max_ncoll) - - real(kind=fPrec), save :: x_pencil0, y_pencil0, sum, sqsum - real(kind=fPrec), save :: average, sigma, sigsecut, nspxd, xndisp, zpj - - real(kind=fPrec), save :: dnormx,dnormy,driftx,drifty,xnorm,xpnorm,xangle,ynorm,ypnorm,yangle,grdpiover2,grdpiover4,grd3piover4 - - real(kind=fPrec), save :: max_tmp, a_tmp1, a_tmp2, ldrift, mynex2, myney2, Nap1pos,Nap2pos,Nap1neg,Nap2neg - real(kind=fPrec), save :: tiltOffsPos1,tiltOffsPos2,tiltOffsNeg1,tiltOffsNeg2 - real(kind=fPrec), save :: beamsize1, beamsize2,betax1,betax2,betay1,betay2, alphax1, alphax2,alphay1,alphay2,minAmpl + ! Variables for global inefficiencies studies of normalized and off-momentum halo + integer, allocatable, private, save :: counteddpop(:,:) ! (npart,numeffdpop) + integer, allocatable, private, save :: npartdpop(:) ! (numeffdpop) + integer, allocatable, private, save :: counted2d(:,:,:) ! (npart,numeff,numeffdpop) + integer, allocatable, private, save :: counted_r(:,:) ! (npart,numeff) + integer, allocatable, private, save :: counted_x(:,:) ! (npart,numeff) + integer, allocatable, private, save :: counted_y(:,:) ! (npart,numeff) + real(kind=fPrec), allocatable, private, save :: neffx(:) ! (numeff) + real(kind=fPrec), allocatable, private, save :: neffy(:) ! (numeff) + real(kind=fPrec), allocatable, private, save :: neff(:) ! (numeff) + real(kind=fPrec), allocatable, private, save :: rsig(:) ! (numeff) + real(kind=fPrec), allocatable, private, save :: neffdpop(:) ! (numeffdpop) + real(kind=fPrec), allocatable, private, save :: dpopbins(:) ! (numeffdpop) + real(kind=fPrec), allocatable, private, save :: neff2d(:,:) ! (numeff,numeffdpop) + + ! Arrays allocated to nblz + integer, allocatable, private, save :: nampl(:) + real(kind=fPrec), allocatable, private, save :: sum_ax(:) + real(kind=fPrec), allocatable, private, save :: sqsum_ax(:) + real(kind=fPrec), allocatable, private, save :: sum_ay(:) + real(kind=fPrec), allocatable, private, save :: sqsum_ay(:) + + ! Arrays allocated to npart + integer, allocatable, private, save :: part_hit_pos(:) ! Hit flag for last hit + integer, allocatable, private, save :: part_hit_turn(:) ! Hit flag for last hit + integer, allocatable, private, save :: part_abs_pos(:) ! Absorbed in element + integer, allocatable, public, save :: part_abs_turn(:) ! Absorbed in turn + integer, allocatable, private, save :: part_select(:) + integer, allocatable, private, save :: nabs_type(:) + integer, allocatable, private, save :: nhit_stage(:) + real(kind=fPrec), allocatable, private, save :: part_linteract(:) + real(kind=fPrec), allocatable, private, save :: part_indiv(:) ! Divergence of impacting particles + real(kind=fPrec), allocatable, private, save :: part_impact(:) ! Impact parameter (0 for inner face) + real(kind=fPrec), allocatable, private, save :: rcx0(:) + real(kind=fPrec), allocatable, private, save :: rcxp0(:) + real(kind=fPrec), allocatable, private, save :: rcy0(:) + real(kind=fPrec), allocatable, private, save :: rcyp0(:) + real(kind=fPrec), allocatable, private, save :: rcp0(:) + + integer, private, save :: n_tot_absorbed = 0 + integer, private, save :: n_absorbed = 0 + integer, private, save :: nabs_total = 0 + integer, private, save :: nsurvive = 0 + integer, private, save :: nsurvive_end = 0 + integer, private, save :: num_selhit = 0 + + ! Variables for finding the collimator with the smallest gap and defining, storing the gap rms error + real(kind=fPrec), allocatable, private, save :: xbob(:) ! (nblz) + real(kind=fPrec), allocatable, private, save :: ybob(:) ! (nblz) + real(kind=fPrec), allocatable, private, save :: xpbob(:) ! (nblz) + real(kind=fPrec), allocatable, private, save :: ypbob(:) ! (nblz) + real(kind=fPrec), allocatable, private, save :: xineff(:) ! (npart) + real(kind=fPrec), allocatable, private, save :: yineff(:) ! (npart) + real(kind=fPrec), allocatable, private, save :: xpineff(:) ! (npart) + real(kind=fPrec), allocatable, private, save :: ypineff(:) ! (npart) + + real(kind=fPrec), private, save :: scale_bx0 = zero + real(kind=fPrec), private, save :: scale_by0 = zero + real(kind=fPrec), private, save :: bx_dist = zero + real(kind=fPrec), private, save :: by_dist = zero contains -subroutine collimation_allocate_arrays +subroutine collimation_expand_arrays(npart_new, nblz_new) use mod_alloc + use coll_common - implicit none + integer, intent(in) :: npart_new + integer, intent(in) :: nblz_new - ! Initial allocation handled by expand arrays routine - call collimation_expand_arrays(npart,nblz) + logical :: efficAlloc = .false. - ! Fixed allocations follow: - call alloc(gap_rms_error, max_ncoll, zero, "gap_rms_error") !(max_ncoll) - call alloc(xp_pencil, max_ncoll, zero, "xp_pencil") - call alloc(yp_pencil, max_ncoll, zero, "yp_pencil") - call alloc(csum, max_ncoll, zero, "csum") - call alloc(csqsum, max_ncoll, zero, "csqsum") + ! Arrays that are always needed + call alloc(part_abs_turn, npart_new, 0, "part_abs_turn") - call alloc(npartdpop, numeffdpop, 0, "npartdpop") !(numeffdpop) - call alloc(neff, numeff, zero, "neff") !(numeff) - call alloc(rsig, numeff, zero, "rsig") !(numeff) - call alloc(neffdpop, numeffdpop, zero, "neffdpop") !(numeffdpop) - call alloc(dpopbins, numeffdpop, zero, "dpopbins") !(numeffdpop) - call alloc(neff2d, numeff, numeffdpop, zero, "neff2d") !(numeff,numeffdpop) + if(.not. do_coll) return - call alloc(nimpact, 50, 0, "nimpact") !(50) - call alloc(sumimpact, 50, zero, "sumimpact") !(50) - call alloc(sqsumimpact, 50, zero, "sqsumimpact") !(50) + ! Arrays below are only needed if collimation is enabled - call alloc(neffx, numeff, zero, "neffx") !(numeff) - call alloc(neffy, numeff, zero, "neffy") !(numeff) + ! Allocate Common Variables + call coll_expandArrays(npart_new, nblz_new) - call alloc(cn_impact, max_ncoll, 0, "cn_impact") !(max_ncoll) - call alloc(cn_absorbed, max_ncoll, 0, "cn_absorbed") !(max_ncoll) - call alloc(caverage, max_ncoll, zero, "caverage") !(max_ncoll) - call alloc(csigma, max_ncoll, zero, "csigma") !(max_ncoll) + call alloc(rcx0, npart_new, zero, "rcx0") + call alloc(rcxp0, npart_new, zero, "rcxp0") + call alloc(rcy0, npart_new, zero, "rcy0") + call alloc(rcyp0, npart_new, zero, "rcyp0") + call alloc(rcp0, npart_new, zero, "rcp0") -end subroutine collimation_allocate_arrays + call alloc(part_hit_pos, npart_new, 0, "part_hit_pos") + call alloc(part_hit_turn, npart_new, 0, "part_hit_turn") + call alloc(part_abs_pos, npart_new, 0, "part_abs_pos") + call alloc(part_select, npart_new, 1, "part_select") + call alloc(nabs_type, npart_new, 0, "nabs_type") + call alloc(nhit_stage, npart_new, 0, "nhit_stage") -subroutine collimation_expand_arrays(npart_new, nblz_new) + call alloc(part_impact, npart_new, zero, "part_impact") + call alloc(part_indiv, npart_new, -c1m6, "part_indiv") + call alloc(part_linteract, npart_new, zero, "part_linteract") - use mod_alloc + if(dowrite_amplitude) then + call alloc(nampl, nblz_new, 0, "nampl") + call alloc(sum_ax, nblz_new, zero, "sum_ax") + call alloc(sqsum_ax, nblz_new, zero, "sqsum_ax") + call alloc(sum_ay, nblz_new, zero, "sum_ay") + call alloc(sqsum_ay, nblz_new, zero, "sqsum_ay") + call alloc(xbob, nblz_new, zero, "xbob") + call alloc(ybob, nblz_new, zero, "ybob") + call alloc(xpbob, nblz_new, zero, "xpbob") + call alloc(ypbob, nblz_new, zero, "ypbob") + end if + + if(dowrite_efficiency) then + call alloc(xineff, npart_new, zero, "xineff") + call alloc(yineff, npart_new, zero, "yineff") + call alloc(xpineff, npart_new, zero, "xpineff") + call alloc(ypineff, npart_new, zero, "ypineff") + call alloc(counted_r, npart_new, numeff, 0, "counted_r") + call alloc(counted_x, npart_new, numeff, 0, "counted_x") + call alloc(counted_y, npart_new, numeff, 0, "counted_y") + call alloc(counteddpop, npart_new, numeffdpop, 0, "counteddpop") + call alloc(counted2d, npart_new, numeff, numeffdpop, 0, "counted2d") + end if + + if(dowrite_efficiency .and. .not. efficAlloc) then + ! These are fixed size, so only need to be allocated once + call alloc(npartdpop, numeffdpop, 0, "npartdpop") + call alloc(neff, numeff, zero, "neff") + call alloc(rsig, numeff, zero, "rsig") + call alloc(neffdpop, numeffdpop, zero, "neffdpop") + call alloc(dpopbins, numeffdpop, zero, "dpopbins") + call alloc(neff2d, numeff, numeffdpop, zero, "neff2d") + call alloc(neffx, numeff, zero, "neffx") + call alloc(neffy, numeff, zero, "neffy") + efficAlloc = .true. + end if + +end subroutine collimation_expand_arrays + +subroutine coll_shuffleLostPart + + use mod_common + use mod_common_main use coll_common - integer, intent(in) :: npart_new - integer, intent(in) :: nblz_new + integer j, tnapx - ! Arrays that are always needed - call alloc(part_abs_turn, npart_new, 0, "part_abs_turn") !(npart_new) + tnapx = napx + do j=napx,1,-1 + if(llostp(j) .eqv. .false.) cycle - if(.not. do_coll) return - ! Arrays that are only needed if Collimation is enabled + part_hit_pos(j:tnapx) = cshift(part_hit_pos(j:tnapx), 1) + part_hit_turn(j:tnapx) = cshift(part_hit_turn(j:tnapx), 1) + part_abs_pos(j:tnapx) = cshift(part_abs_pos(j:tnapx), 1) + part_abs_turn(j:tnapx) = cshift(part_abs_turn(j:tnapx), 1) + part_select(j:tnapx) = cshift(part_select(j:tnapx), 1) + part_impact(j:tnapx) = cshift(part_impact(j:tnapx), 1) + part_indiv(j:tnapx) = cshift(part_indiv(j:tnapx), 1) + part_linteract(j:tnapx) = cshift(part_linteract(j:tnapx), 1) - ! Allocate Common Variables - call coll_expandArrays(npart_new, nblz_new) + nabs_type(j:tnapx) = cshift(nabs_type(j:tnapx), 1) + nhit_stage(j:tnapx) = cshift(nhit_stage(j:tnapx), 1) - call alloc(rcx0, npart_new, zero, "rcx0") !(npart) - call alloc(rcxp0, npart_new, zero, "rcxp0") !(npart) - call alloc(rcy0, npart_new, zero, "rcy0") !(npart) - call alloc(rcyp0, npart_new, zero, "rcyp0") !(npart) - call alloc(rcp0, npart_new, zero, "rcp0") !(npart) - - call alloc(xbob, nblz_new, zero, "xbob") !(nblz) - call alloc(ybob, nblz_new, zero, "ybob") !(nblz) - call alloc(xpbob, nblz_new, zero, "xpbob") !(nblz) - call alloc(ypbob, nblz_new, zero, "ypbob") !(nblz) - - call alloc(xineff, npart_new, zero, "xineff") !(npart) - call alloc(yineff, npart_new, zero, "yineff") !(npart) - call alloc(xpineff, npart_new, zero, "xpineff") !(npart) - call alloc(ypineff, npart_new, zero, "ypineff") !(npart) - - call alloc(mux, nblz_new, zero, "mux") !(nblz) - call alloc(muy, nblz_new, zero, "muy") !(nblz) - - call alloc(counteddpop, npart_new, numeffdpop, 0, "counteddpop") !(npart,numeffdpop) - call alloc(counted2d, npart_new, numeff, numeffdpop, 0, "counted2d") !(npart,numeff,numeffdpop) - - call alloc(nampl, nblz_new, 0, "nampl") !(nblz_new) - call alloc(sum_ax, nblz_new, zero, "sum_ax") !(nblz_new) - call alloc(sqsum_ax, nblz_new, zero, "sqsum_ax") !(nblz_new) - call alloc(sum_ay, nblz_new, zero, "sum_ay") !(nblz_new) - call alloc(sqsum_ay, nblz_new, zero, "sqsum_ay") !(nblz_new) - - call alloc(part_hit_before_pos, npart_new, 0, "part_hit_before_pos") !(npart_new) - call alloc(part_hit_before_turn, npart_new, 0, "part_hit_before_turn") !(npart_new) - call alloc(part_hit_pos, npart_new, 0, "part_hit_pos") !(npart_new) - call alloc(part_hit_turn, npart_new, 0, "part_hit_turn") !(npart_new) - call alloc(part_abs_pos, npart_new, 0, "part_abs_pos") !(npart_new) - call alloc(part_select, npart_new, 0, "part_select") !(npart_new) - call alloc(nabs_type, npart_new, 0, "nabs_type") !(npart_new) - call alloc(nhit_stage, npart_new, 0, "nhit_stage") !(npart_new) - - call alloc(part_impact, npart_new, zero, "part_impact") !(npart_new) - call alloc(part_indiv, npart_new, zero, "part_indiv") !(npart_new) - call alloc(part_linteract, npart_new, zero, "part_linteract") !(npart_new) - - call alloc(counted_r, npart_new, numeff, 0, "counted_r") !(npart_new,numeff) - call alloc(counted_x, npart_new, numeff, 0, "counted_x") !(npart_new,numeff) - call alloc(counted_y, npart_new, numeff, 0, "counted_y") !(npart_new,numeff) + tnapx = tnapx - 1 + end do -end subroutine collimation_expand_arrays + if(dowrite_efficiency) then + tnapx = napx + do j=napx,1,-1 + if(llostp(j) .eqv. .false.) cycle + + counted_r(j:tnapx,:) = cshift(counted_r(j:tnapx,:), 1, 1) + counted_x(j:tnapx,:) = cshift(counted_x(j:tnapx,:), 1, 1) + counted_y(j:tnapx,:) = cshift(counted_y(j:tnapx,:), 1, 1) + + tnapx = tnapx - 1 + end do + end if + +end subroutine coll_shuffleLostPart ! ================================================================================================ ! ! Collimation Init ! This routine is called once at the start of the simulation and can be used to do any initial ! configuration and/or file loading. ! ================================================================================================ ! -subroutine collimate_init +subroutine coll_init use crcoall - use parpro - use coll_common use mod_common use mod_common_main - use mod_commons use mod_common_track - use mod_common_da - use mod_settings - use mod_time - use string_tools use coll_k2 use coll_db use coll_dist + use coll_common use coll_crystal use coll_materials + use mod_time use mod_units use mod_ranlux use mod_particles @@ -378,66 +302,19 @@ subroutine collimate_init type(h5_dataField), allocatable :: fldDist0(:) integer :: fmtDist0, setDist0 #endif - integer :: i,j,fUnit + integer i,j,fUnit,minGapID + real(kind=fPrec) dummy,c_rmstilt,c_systilt #ifdef HDF5 if(h5_useForCOLL) call h5_initForCollimation #endif - call f_requestUnit("colltrack.out", outlun) - call f_open(unit=outlun,file="colltrack.out",formatted=.true.,mode="w",status="replace") - - write(outlun,*) - write(outlun,*) - write(outlun,*) ' -------------------------------' - write(outlun,*) - write(outlun,*) ' Program C O L L T R A C K ' - write(outlun,*) - write(outlun,*) ' R. Assmann - AB/ABP' - write(outlun,*) ' C.Bracco - AB/ABP' - write(outlun,*) ' V. Previtali - AB/ABP' - write(outlun,*) ' S. Redaelli - AB/OP' - write(outlun,*) ' G. Robert-Demolaize - BNL' - write(outlun,*) ' A. Rossi - AB/ABP' - write(outlun,*) ' T. Weiler - IEKP' - write(outlun,*) - write(outlun,*) ' CERN 2001 - 2009' - write(outlun,*) - write(outlun,*) ' -------------------------------' - write(outlun,*) - write(outlun,*) - - write(lout,"(a)") "" - write(lout,"(a)") str_divLine - write(lout,"(a)") " INITIALISING COLLIMATION" - write(lout,"(a)") str_divLine - write(lout,"(a)") "" - write(lout,"(a,e15.8)") 'COLL> Info: Betax0 [m] = ', tbetax(1) - write(lout,"(a,e15.8)") 'COLL> Info: Betay0 [m] = ', tbetay(1) - write(lout,"(a,e15.8)") 'COLL> Info: Alphax0 = ', talphax(1) - write(lout,"(a,e15.8)") 'COLL> Info: Alphay0 = ', talphay(1) - write(lout,"(a,e15.8)") 'COLL> Info: Orbitx0 [mm] = ', torbx(1) - write(lout,"(a,e15.8)") 'COLL> Info: Orbitxp0 [mrad] = ', torbxp(1) - write(lout,"(a,e15.8)") 'COLL> Info: Orbity0 [mm] = ', torby(1) - write(lout,"(a,e15.8)") 'COLL> Info: Orbitpy0 [mrad] = ', torbyp(1) - write(lout,"(a,e15.8)") 'COLL> Info: Emitx0_dist [um] = ', remitx_dist - write(lout,"(a,e15.8)") 'COLL> Info: Emity0_dist [um] = ', remity_dist - write(lout,"(a,e15.8)") 'COLL> Info: Emitx0_collgap [um] = ', remitx_collgap - write(lout,"(a,e15.8)") 'COLL> Info: Emity0_collgap [um] = ', remity_collgap - write(lout,"(a,e15.8)") 'COLL> Info: E0 [MeV] = ', e0 - write(lout,"(a)") - - myemitx0_dist = remitx_dist*c1m6 - myemity0_dist = remity_dist*c1m6 - myemitx0_collgap = remitx_collgap*c1m6 - myemity0_collgap = remity_collgap*c1m6 + c_emitx0_dist = (emitnx0_dist*gammar)*c1m6 + c_emity0_dist = (emitny0_dist*gammar)*c1m6 + c_emitx0_collgap = (emitnx0_collgap*gammar)*c1m6 + c_emity0_collgap = (emitny0_collgap*gammar)*c1m6 - myalphax = talphax(1) - myalphay = talphay(1) - mybetax = tbetax(1) - mybetay = tbetay(1) - - if(myemitx0_dist <= zero .or. myemity0_dist <= zero .or. myemitx0_collgap <= zero .or. myemity0_collgap <= zero) then + if(c_emitx0_dist <= zero .or. c_emity0_dist <= zero .or. c_emitx0_collgap <= zero .or. c_emity0_collgap <= zero) then write(lerr,"(a)") "COLL> ERROR Emittances not defined! check collimat block!" write(lerr,"(a)") "COLL> ERROR Expected format of line 9 in collimat block:" write(lerr,"(a)") "COLL> ERROR emitnx0_dist emitny0_dist emitnx0_collgap emitny0_collgap" @@ -447,121 +324,16 @@ subroutine collimate_init call prror end if - write(lout,"(a,i0)") 'COLL> Info: DIST_TYPES = ', do_thisdis - write(lout,"(a,e15.8)") 'COLL> Info: DIST_NEX = ', cdist_ampX - write(lout,"(a,e15.8)") 'COLL> Info: DIST_DEX = ', cdist_smearX - write(lout,"(a,e15.8)") 'COLL> Info: DIST_NEY = ', cdist_ampY - write(lout,"(a,e15.8)") 'COLL> Info: DIST_DEY = ', cdist_smearY - write(lout,"(a,a)") 'COLL> Info: DIST_FILE = ', trim(cdist_fileName) - write(lout,"(a,e15.8)") 'COLL> Info: DIST_EN_ERROR = ', cdist_spreadE - write(lout,"(a,e15.8)") 'COLL> Info: DIST_BUNCHLENGTH = ', cdist_bunchLen - write(lout,"(a,l1)") 'COLL> Info: DO_COLL = ', do_coll - write(lout,"(a,l1)") 'COLL> Info: DO_NSIG = ', cdb_doNSig - do i=1,cdb_nFam - write(lout,"(a,a19,a3,f13.6)") "COLL> Info: ",chr_rPad("NSIG_"//trim(chr_toUpper(cdb_famName(i))),19)," = ",cdb_famNSig(i) - end do - write(lout,"(a)") - write(lout,"(a)") 'COLL> INPUT PARAMETERS FOR THE SLICING:' - write(lout,"(a)") - write(lout,"(a,i0)") 'COLL> Info: N_SLICES = ', n_slices - write(lout,"(a,e15.8)") 'COLL> Info: SMIN_SLICES = ', smin_slices - write(lout,"(a,e15.8)") 'COLL> Info: SMAX_SLICES = ', smax_slices - write(lout,"(a,e15.8)") 'COLL> Info: RECENTER1 = ', recenter1 - write(lout,"(a,e15.8)") 'COLL> Info: RECENTER2 = ', recenter2 - write(lout,"(a)") - write(lout,"(a,e15.8)") 'COLL> Info: JAW_FIT(1,1) = ', jaw_fit(1,1) - write(lout,"(a,e15.8)") 'COLL> Info: JAW_FIT(1,2) = ', jaw_fit(1,2) - write(lout,"(a,e15.8)") 'COLL> Info: JAW_FIT(1,3) = ', jaw_fit(1,3) - write(lout,"(a,e15.8)") 'COLL> Info: JAW_FIT(1,4) = ', jaw_fit(1,4) - write(lout,"(a,e15.8)") 'COLL> Info: JAW_FIT(1,5) = ', jaw_fit(1,5) - write(lout,"(a,e15.8)") 'COLL> Info: JAW_FIT(1,6) = ', jaw_fit(1,6) - write(lout,"(a,e15.8)") 'COLL> Info: SCALING1 = ', jaw_ssf(1) - write(lout,"(a)") - write(lout,"(a,e15.8)") 'COLL> Info: JAW_FIT(2,1) = ', jaw_fit(2,1) - write(lout,"(a,e15.8)") 'COLL> Info: JAW_FIT(2,2) = ', jaw_fit(2,2) - write(lout,"(a,e15.8)") 'COLL> Info: JAW_FIT(2,3) = ', jaw_fit(2,3) - write(lout,"(a,e15.8)") 'COLL> Info: JAW_FIT(2,4) = ', jaw_fit(2,4) - write(lout,"(a,e15.8)") 'COLL> Info: JAW_FIT(2,5) = ', jaw_fit(2,5) - write(lout,"(a,e15.8)") 'COLL> Info: JAW_FIT(2,6) = ', jaw_fit(2,6) - write(lout,"(a,e15.8)") 'COLL> Info: SCALING2 = ', jaw_ssf(2) - write(lout,"(a)") - write(lout,"(a,e15.8)") 'COLL> Info: EMITXN0_DIST = ', emitnx0_dist - write(lout,"(a,e15.8)") 'COLL> Info: EMITYN0_DIST = ', emitny0_dist - write(lout,"(a,e15.8)") 'COLL> Info: EMITXN0_COLLGAP = ', emitnx0_collgap - write(lout,"(a,e15.8)") 'COLL> Info: EMITYN0_COLLGAP = ', emitny0_collgap - write(lout,"(a)") - write(lout,"(a,l1)") 'COLL> Info: DO_SELECT = ', do_select - write(lout,"(a,l1)") 'COLL> Info: DO_NOMINAL = ', do_nominal - write(lout,"(a,i0)") 'COLL> Info: RND_SEED = ', rnd_seed - write(lout,"(a,l1)") 'COLL> Info: DOWRITE_DIST = ', dowrite_dist - write(lout,"(a,a)") 'COLL> Info: NAME_SEL = ', name_sel - write(lout,"(a,l1)") 'COLL> Info: DO_ONESIDE = ', do_oneside - write(lout,"(a,l1)") 'COLL> Info: DOWRITE_IMPACT = ', dowrite_impact - write(lout,"(a,l1)") 'COLL> Info: DOWRITE_SECONDARY = ', dowrite_secondary - write(lout,"(a,l1)") 'COLL> Info: DOWRITE_AMPLITUDE = ', dowrite_amplitude - write(lout,"(a)") - write(lout,"(a,e15.8)") 'COLL> Info: XBEAT = ', xbeat - write(lout,"(a,e15.8)") 'COLL> Info: XBEATPHASE = ', xbeatphase - write(lout,"(a,e15.8)") 'COLL> Info: YBEAT = ', ybeat - write(lout,"(a,e15.8)") 'COLL> Info: YBEATPHASE = ', ybeatphase - write(lout,"(a)") - write(lout,"(a,e15.8)") 'COLL> Info: C_RMSTILT_PRIM = ', c_rmstilt_prim - write(lout,"(a,e15.8)") 'COLL> Info: C_RMSTILT_SEC = ', c_rmstilt_sec - write(lout,"(a,e15.8)") 'COLL> Info: C_SYSTILT_PRIM = ', c_systilt_prim - write(lout,"(a,e15.8)") 'COLL> Info: C_SYSTILT_SEC = ', c_systilt_sec - write(lout,"(a,e15.8)") 'COLL> Info: C_RMSOFFSET_PRIM = ', c_rmsoffset_prim - write(lout,"(a,e15.8)") 'COLL> Info: C_SYSOFFSET_PRIM = ', c_sysoffset_prim - write(lout,"(a,e15.8)") 'COLL> Info: C_RMSOFFSET_SEC = ', c_rmsoffset_sec - write(lout,"(a,e15.8)") 'COLL> Info: C_SYSOFFSET_SEC = ', c_sysoffset_sec - write(lout,"(a,i0)") 'COLL> Info: C_OFFSETTITLT_SEED = ', c_offsettilt_seed - write(lout,"(a,e15.8)") 'COLL> Info: C_RMSERROR_GAP = ', c_rmserror_gap - write(lout,"(a,l1)") 'COLL> Info: DO_MINGAP = ', do_mingap - write(lout,"(a)") - write(lout,"(a,l1)") 'COLL> Info: RADIAL = ', radial - write(lout,"(a,e15.8)") 'COLL> Info: NR = ', cdist_ampR - write(lout,"(a,e15.8)") 'COLL> Info: NDR = ', cdist_smearR - write(lout,"(a)") - write(lout,"(a,e15.8)") 'COLL: Info: DRIFTSX = ', driftsx - write(lout,"(a,e15.8)") 'COLL: Info: DRIFTSY = ', driftsy - write(lout,"(a,l1)") 'COLL: Info: SYSTILT_ANTISYMM = ', systilt_antisymm - write(lout,"(a)") - write(lout,"(a,i0)") 'COLL> Info: IPENCIL = ', ipencil - write(lout,"(a,e15.8)") 'COLL> Info: PENCIL_OFFSET = ', pencil_offset - write(lout,"(a,e15.8)") 'COLL> Info: PENCIL_RMSX = ', pencil_rmsx - write(lout,"(a,e15.8)") 'COLL> Info: PENCIL_RMSY = ', pencil_rmsy - write(lout,"(a,i0)") 'COLL> Info: PENCIL_DISTR = ', pencil_distr - write(lout,"(a)") - write(lout,"(a,a)") 'COLL> Info: COLL_DB = ', cdb_fileName - write(lout,"(a)") - write(lout,"(a,l1)") 'COLL> Info: DOWRITETRACKS = ', dowritetracks - write(lout,"(a)") - write(lout,"(a,e15.8)") 'COLL> Info: SIGSECUT2 = ', sigsecut2 - write(lout,"(a,e15.8)") 'COLL> Info: SIGSECUT3 = ', sigsecut3 - write(lout,"(a)") - write(lout,"(a,i0)") 'COLL> Info: NAPX = ', napx - write(lout,"(a,e15.8)") 'COLL> Info: Sigma_x0 = ', sqrt(mybetax*myemitx0_dist) - write(lout,"(a,e15.8)") 'COLL> Info: Sigma_y0 = ', sqrt(mybetay*myemity0_dist) - write(lout,"(a)") + call coll_echoSettings ! Initialize random number generator if(rnd_seed == 0) rnd_seed = time_getSysClock() if(rnd_seed < 0) rnd_seed = abs(rnd_seed) - rnd_lux = 3 - rnd_k1 = 0 - rnd_k2 = 0 - call rluxgo(rnd_lux, rnd_seed, rnd_k1, rnd_k2) + call rluxgo(3, rnd_seed, 0, 0) write(outlun,*) 'INFO> rnd_seed: ', rnd_seed - ! Call distribution routines only if collimation block is in fort.3 - cdist_energy = myenom - cdist_alphaX = myalphax - cdist_alphaY = myalphay - cdist_betaX = mybetax - cdist_betaY = mybetay - cdist_emitX = myemitx0_dist - cdist_emitY = myemity0_dist - cdist_emitXColl = myemitx0_collgap - cdist_emitYColl = myemity0_collgap + ! Call distribution routines + call cdist_init(c_enom,c_emitx0_dist,c_emity0_dist,c_emitx0_collgap,c_emity0_collgap) if(radial) then call cdist_makeRadial else @@ -613,27 +385,6 @@ subroutine collimate_init #endif end if - ! Initialise efficiency array - do i=1,iu - sum_ax(i) = zero - sqsum_ax(i) = zero - sum_ay(i) = zero - sqsum_ay(i) = zero - nampl(i) = zero - end do - - nspx = zero - nspy = zero - ax0 = myalphax - bx0 = mybetax - mux0 = mux(1) - ay0 = myalphay - by0 = mybetay - muy0 = muy(1) - iturn = 1 - ie = 1 - n_tot_absorbed = 0 - ! Collimator Database and Materials call collmat_init ! Set default values for collimator materials call cdb_readCollDB ! Read the collimator DB @@ -656,22 +407,22 @@ subroutine collimate_init call prror end if -! Open the edep file + ! Open the edep file if(unit208 == -1) then call f_requestUnit(fort208,unit208) call f_open(unit=unit208,file=fort208,formatted=.true.,mode="w",status="replace") end if -!! This function lives in the G4Interface.cpp file in the g4collimat folder -!! Accessed by linking libg4collimat.a -!! Set the energy cut at 70% - i.e. 30% energy loss -! g4_ecut = 0.7_fPrec -! g4_ecut = zero + ! This function lives in the G4Interface.cpp file in the g4collimat folder + ! Accessed by linking libg4collimat.a + ! Set the energy cut at 70% - i.e. 30% energy loss + ! g4_ecut = 0.7_fPrec + ! g4_ecut = zero -!! Select the physics engine to use -!! 0 = FTFP_BERT -!! 1 = QGSP_BERT -! g4_physics = 0 + ! Select the physics engine to use + ! 0 = FTFP_BERT + ! 1 = QGSP_BERT + ! g4_physics = 0 call g4_collimation_init(e0, rnd_seed, g4_recut, g4_aecut, g4_rcut, g4_rangecut_mm, g4_v0, trim(g4_phys_str), & g4_debug, g4_keep_stable, g4_edep) @@ -683,25 +434,128 @@ subroutine collimate_init ! Adding the orbit offset at start of ring if(do_thisdis /= 0 .or. radial) then - xv1(1:napx) = c1e3 * xv1(1:napx) + torbx(1) - yv1(1:napx) = c1e3 * yv1(1:napx) + torbxp(1) - xv2(1:napx) = c1e3 * xv2(1:napx) + torby(1) - yv2(1:napx) = c1e3 * yv2(1:napx) + torbyp(1) + xv1(1:napx) = c1e3*xv1(1:napx) + torbx(1) + yv1(1:napx) = c1e3*yv1(1:napx) + torbxp(1) + xv2(1:napx) = c1e3*xv2(1:napx) + torby(1) + yv2(1:napx) = c1e3*yv2(1:napx) + torbyp(1) end if call part_updatePartEnergy(1,.false.) + call coll_openFiles + + ! Initialisation + if(dowrite_efficiency) then + do i=1,numeff + rsig(i) = (real(i,fPrec)/two - half) + five + end do + dpopbins(1) = c1m4 + do i=2,numeffdpop + dpopbins(i) = real(i-1,fPrec)*4.0e-4_fPrec + end do + end if + +#ifdef BEAMGAS + call beamGasInit(c_enom) +#endif + + write(lout,"(a)") "" + write(lout,"(a,i0)") "COLL> Number of collimators: ",cdb_nColl + do i=1,cdb_nColl + if(cdb_cFound(i)) then + write(lout,"(a,i5,a)") "COLL> Found Collimator ",i,": "//trim(cdb_cName(i)) + else + write(lout,"(a,i5,a)") "COLL> Missing Collimator ",i,": "//trim(cdb_cName(i)) + end if + end do + write(lout,"(a)") "" + + ! Write settings for alignment error in colltrack.out file + write(outlun,*) ' ' + write(outlun,*) 'Alignment errors settings (tilt, offset,...)' + write(outlun,*) ' ' + write(outlun,*) 'SETTING> c_rmstilt_prim : ', c_rmstilt_prim + write(outlun,*) 'SETTING> c_rmstilt_sec : ', c_rmstilt_sec + write(outlun,*) 'SETTING> c_systilt_prim : ', c_systilt_prim + write(outlun,*) 'SETTING> c_systilt_sec : ', c_systilt_sec + write(outlun,*) 'SETTING> c_rmsoffset_prim : ', c_rmsoffset_prim + write(outlun,*) 'SETTING> c_rmsoffset_sec : ', c_rmsoffset_sec + write(outlun,*) 'SETTING> c_sysoffset_prim : ', c_sysoffset_prim + write(outlun,*) 'SETTING> c_sysoffset_sec : ', c_sysoffset_sec + write(outlun,*) 'SETTING> c_offsettilt seed: ', c_offsettilt_seed + write(outlun,*) 'SETTING> c_rmserror_gap : ', c_rmserror_gap + write(outlun,*) 'SETTING> do_mingap : ', do_mingap + write(outlun,*) ' ' + + ! Intialise random generator with offset_seed + c_offsettilt_seed = abs(c_offsettilt_seed) + call rluxgo(3, c_offsettilt_seed, 0, 0) + + ! Generate random tilts (Gaussian distribution plus systematic) + if(c_rmstilt_prim > zero .or. c_rmstilt_sec > zero .or. c_systilt_prim /= zero .or. c_systilt_sec /= zero) then + do i=1,cdb_nColl + if(cdb_cStage(i) == cdb_stgPrimary) then + c_rmstilt = c_rmstilt_prim + c_systilt = c_systilt_prim + else + c_rmstilt = c_rmstilt_sec + c_systilt = c_systilt_sec + end if + cdb_cTilt(1,i) = c_systilt + c_rmstilt*ran_gauss2(three) + if(systilt_antisymm) then + cdb_cTilt(2,i) = -one*c_systilt + c_rmstilt*ran_gauss2(three) + else + cdb_cTilt(2,i) = c_systilt + c_rmstilt*ran_gauss2(three) + end if + write(outlun,*) 'INFO> Collimator ',trim(cdb_cName(i)),' jaw 1 has tilt [rad]: ',cdb_cTilt(1,i) + write(outlun,*) 'INFO> Collimator ',trim(cdb_cName(i)),' jaw 2 has tilt [rad]: ',cdb_cTilt(2,i) + end do + + do i=1,cdb_nColl + if(cdb_cStage(i) == cdb_stgPrimary) then + cdb_cOffset(i) = c_sysoffset_prim + c_rmsoffset_prim*ran_gauss2(three) + else + cdb_cOffset(i) = c_sysoffset_sec + c_rmsoffset_sec*ran_gauss2(three) + end if + write(outlun,*) 'INFO> Offset: ',trim(cdb_cName(i)),cdb_cOffset(i) + end do + end if + if(c_rmserror_gap > zero) then + do i=1,cdb_nColl + gap_rms_error(i) = c_rmserror_gap * ran_gauss2(three) + write(outlun,*) 'INFO> Gap RMS error: ',trim(cdb_cName(i)),gap_rms_error(i) + end do + end if + + ! In case we're using old type jaw fit, this is where we generate the parameters for the new method + ! After this, the number of slices is also stored per collimator, and can be extracted again later + call cdb_setMasterJawFit(n_slices, smin_slices, smax_slices, recenter1, recenter2, jaw_fit, jaw_ssf) + + call coll_getMinGapID(minGapID) - call collimate_openFiles - call collimate_start + ! if pencil beam is used and on collimator with smallest gap the + ! distribution should be generated, set ipencil to minGapID + if(ipencil > 0 .and. do_mingap) then + ipencil = minGapID + end if + + ! This sets the random geenrator back to the default seed rather than the one used for coll gaps. + ! However, this doesn't actually restore the random generator to the state it would have been in without the + ! coll gaps errors being generated as rndm5() will extract 30000 new random numbers from ranlux and discard + ! the ones it already holds and would have used. + ! Alternatively, we can use ranecu instead, which is capable of continuing a chain of random numbers from + ! a given set of seeds. + ! It is probably unnecessary to use different random seeds here in the first place. + call rluxgo(3, rnd_seed, 0, 0) + dummy = rndm5(1) ! Reset rndm5 too -end subroutine collimate_init +end subroutine coll_init ! ================================================================================================ ! ! Parse Input Line ! V.K. Berglyd Olsen, BE-ABP-HSS ! Updated: 2019-04-16 ! ================================================================================================ ! -subroutine collimate_parseInputLine(inLine, iLine, iErr) +subroutine coll_parseInputLine(inLine, iLine, iErr) use crcoall use coll_db @@ -710,8 +564,6 @@ subroutine collimate_parseInputLine(inLine, iLine, iErr) use coll_common use mod_common, only : napx - implicit none - character(len=*), intent(in) :: inLine integer, intent(inout) :: iLine logical, intent(inout) :: iErr @@ -757,7 +609,7 @@ subroutine collimate_parseInputLine(inLine, iLine, iErr) iErr = .true. return end if - call chr_cast(lnSplit(2), myenom, iErr) + call chr_cast(lnSplit(2), c_enom, iErr) case("DIST_TYPE") if(nSplit /= 2) then @@ -945,6 +797,15 @@ subroutine collimate_parseInputLine(inLine, iLine, iErr) end if call chr_cast(lnSplit(2), dowrite_amplitude, iErr) + case("WRITE_EFFIC","WRITE_EFFICIENCY") + if(nSplit /= 2) then + write(lerr,"(a,i0)") "COLL> ERROR WRITE_EFFIC expects 1 value, got ",nSplit-1 + write(lerr,"(a)") "COLL> WRITE_EFFIC true|false" + iErr = .true. + return + end if + call chr_cast(lnSplit(2), dowrite_efficiency, iErr) + case("BETA_BEAT") if(nSplit /= 5) then write(lerr,"(a,i0)") "COLL> ERROR BETA_BEAT expects 4 values, got ",nSplit-1 @@ -1072,7 +933,7 @@ subroutine collimate_parseInputLine(inLine, iLine, iErr) iErr = .true. return end if - call chr_cast(lnSplit(2), dowritetracks, iErr) + call chr_cast(lnSplit(2), dowrite_tracks, iErr) case("WRITE_CRYCOORDS") if(nSplit /= 2) then @@ -1125,7 +986,7 @@ subroutine collimate_parseInputLine(inLine, iLine, iErr) return end if call chr_cast(lnSplit(1),iDum,iErr) - call chr_cast(lnSplit(2),myenom,iErr) + call chr_cast(lnSplit(2),c_enom,iErr) if(iDum /= 1) then write(lerr,"(a,i0)") "COLL> ERROR Multiple samples is no longer supported. nloop must be 1, got ",iDum @@ -1265,8 +1126,8 @@ subroutine collimate_parseInputLine(inLine, iLine, iErr) call chr_cast(lnSplit(4), emitny0_collgap,iErr) case(10) - if(nSplit /= 9) then - write(lerr,"(a,i0)") "COLL> ERROR Expected 9 values on line 10, got ",nSplit + if(nSplit /= 9 .and. nSplit /= 10) then + write(lerr,"(a,i0)") "COLL> ERROR Expected 9 or 10 values on line 10, got ",nSplit iErr = .true. return end if @@ -1279,6 +1140,10 @@ subroutine collimate_parseInputLine(inLine, iLine, iErr) call chr_cast(lnSplit(7), dowrite_impact, iErr) call chr_cast(lnSplit(8), dowrite_secondary,iErr) call chr_cast(lnSplit(9), dowrite_amplitude,iErr) + if(nSplit > 9) then + ! This one is optional as it's been added later + call chr_cast(lnSplit(10), dowrite_efficiency,iErr) + end if case(11) if(nSplit /= 4) then @@ -1364,7 +1229,7 @@ subroutine collimate_parseInputLine(inLine, iLine, iErr) iErr = .true. return end if - call chr_cast(lnSplit(1), dowritetracks,iErr) + call chr_cast(lnSplit(1), dowrite_tracks,iErr) ! The second value is ignored ! The third value is ignored ! The fourth value is ignored @@ -1377,24 +1242,23 @@ subroutine collimate_parseInputLine(inLine, iLine, iErr) end select -end subroutine collimate_parseInputLine +end subroutine coll_parseInputLine -subroutine collimate_postInput(gammar) +! ================================================================================================ ! +! Post-input checks for the sanity of parameters +! ================================================================================================ ! +subroutine coll_postInput(gammar) use crcoall use coll_db real(kind=fPrec), intent(in) :: gammar + ! Call one extra time as some arrays depend on input values call collimation_expand_arrays(npart,nblz) - remitx_dist = emitnx0_dist*gammar - remity_dist = emitny0_dist*gammar - remitx_collgap = emitnx0_collgap*gammar - remity_collgap = emitny0_collgap*gammar - - if(myenom == zero) then - write(lerr,"(a)") "COLL> ERROR Beam energy cannot be zero" + if(c_enom <= zero) then + write(lerr,"(a)") "COLL> ERROR Beam energy must bea larger than zero" call prror end if @@ -1403,9 +1267,12 @@ subroutine collimate_postInput(gammar) call prror end if -end subroutine collimate_postInput +end subroutine coll_postInput -subroutine collimate_openFiles +! ================================================================================================ ! +! Open the main output files for collimation +! ================================================================================================ ! +subroutine coll_openFiles use mod_units use string_tools @@ -1444,16 +1311,8 @@ subroutine collimate_openFiles call f_open(unit=coll_positionsUnit,file=coll_positionsFile,formatted=.true.,mode="w",status="replace") write(coll_positionsUnit,"(a)") "# Ind Name Pos[m]" - ! Twiss-Like File - call f_requestUnit(coll_twissLikeFile,coll_twissLikeUnit) - call f_open(unit=coll_twissLikeUnit,file=coll_twissLikeFile,formatted=.true.,mode="w",status="replace") - - ! Sigma Settings File - call f_requestUnit(coll_sigmaSetFile,coll_sigmaSetUnit) - call f_open(unit=coll_sigmaSetUnit,file=coll_sigmaSetFile,formatted=.true.,mode="w",status="replace") - ! Tracks Files - if(dowritetracks) then + if(dowrite_tracks) then call f_requestUnit(coll_tracksFile,coll_tracksUnit) call f_open(unit=coll_tracksUnit,file=coll_tracksFile,formatted=.true.,mode="w",status="replace") write(coll_tracksUnit,"(a)") "# name turn s x xp y yp DE/E type" @@ -1494,7 +1353,6 @@ subroutine collimate_openFiles call f_requestUnit(coll_allAbsorbFile, coll_allAbsorbUnit) call f_requestUnit(coll_scatterFile, coll_scatterUnit) call f_requestUnit(coll_fstImpactFile, coll_fstImpactUnit) - call f_requestUnit(coll_impactFile, coll_impactUnit) call f_requestUnit(coll_flukImpFile, coll_flukImpUnit) call f_requestUnit(coll_flukImpAllFile,coll_flukImpAllUnit) call f_requestUnit(coll_jawProfileFile,coll_jawProfileUnit) @@ -1503,7 +1361,6 @@ subroutine collimate_openFiles call f_open(unit=coll_allAbsorbUnit, file=coll_allAbsorbFile, formatted=.true.,mode="w",status="replace") call f_open(unit=coll_scatterUnit, file=coll_scatterFile, formatted=.true.,mode="w",status="replace") call f_open(unit=coll_fstImpactUnit, file=coll_fstImpactFile, formatted=.true.,mode="w",status="replace") - call f_open(unit=coll_impactUnit, file=coll_impactFile, formatted=.true.,mode="w",status="replace") call f_open(unit=coll_flukImpUnit, file=coll_flukImpFile, formatted=.true.,mode="w",status="replace") call f_open(unit=coll_flukImpAllUnit,file=coll_flukImpAllFile,formatted=.true.,mode="w",status="replace") call f_open(unit=coll_jawProfileUnit,file=coll_jawProfileFile,formatted=.true.,mode="w",status="replace") @@ -1514,7 +1371,6 @@ subroutine collimate_openFiles "7=x_in(b!)[m], 8=xp_in, 9=y_in, 10=yp_in, 11=x_out [m], 12=xp_out, 13=y_out, 14=yp_out" write(coll_scatterUnit,"(a)") "# 1=icoll, 2=iturn, 3=np, 4=nabs (1:Nuclear-Inelastic,2:Nuclear-Elastic,3:pp-Elastic, "//& "4:Single-Diffractive,5:Coulomb), 5=dp, 6=dx', 7=dy'" - write(coll_impactUnit,"(a)") "# impact divergence" write(coll_flukImpUnit,"(a)") "# 1=icoll 2=c_rotation 3=s 4=x 5=xp 6=y 7=yp 8=nabs 9=np 10=turn" write(coll_flukImpAllUnit,"(a)") "# 1=icoll 2=c_rotation 3=s 4=x 5=xp 6=y 7=yp 8=nabs 9=np 10=turn" write(coll_jawProfileUnit,"(a1,1x,a6,1x,2(a7,1x),5(a17,1x),a12)") "#", "icoll", "iturn", "np", "x[m]", "xp[]", "y[m]", "yp[]",& @@ -1535,7 +1391,7 @@ subroutine collimate_openFiles call h5_createDataSet("survival", h5_collID, fmtHdf, coll_hdf5_survival, numl) deallocate(setFields) - if(dowritetracks) then + if(dowrite_tracks) then if(h5_writeTracks2) call h5tr2_init end if @@ -1588,423 +1444,69 @@ subroutine collimate_openFiles #endif -end subroutine collimate_openFiles +end subroutine coll_openFiles -!> -!! collimate_start_sample() -!! This routine is called from trauthin before each sample -!! is injected into thin 6d -!< -subroutine collimate_start +! ================================================================================================ ! +! Statistics for the amplitude.dat file +! ================================================================================================ ! +subroutine coll_computeStats - use parpro - use crcoall - use coll_common use mod_common use mod_common_main use mod_common_track - use coll_db - use mod_ranlux - use mathlib_bouncer - use mod_units - - integer i,j,k - real(kind=fPrec) dummy - - do i=1,napx - do ieff=1,numeff - counted_r(i,ieff) = 0 - counted_x(i,ieff) = 0 - counted_y(i,ieff) = 0 - do ieffdpop =1, numeffdpop - counted2d(i,ieff,ieffdpop) = 0 - end do - end do - - do ieffdpop =1, numeffdpop - counteddpop(i,ieffdpop) = 0 - end do - end do - -!!!!!!!!!!!!!!!!!!!!!!START THIN6D CUT!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!! - -!++ Some initialization - do i = 1, numeff - rsig(i) = (real(i,fPrec)/two - half) + five - end do - - dpopbins(1) = c1m4 - - do i = 2, numeffdpop - dpopbins(i) = real(i-1,fPrec)*4e-4_fPrec - end do - - firstcoll = .true. - -!GRD HERE WE NEED TO INITIALIZE SOME COLLIMATION PARAMETERS - - do j = 1, napx - part_hit_pos(j) = 0 - part_hit_turn(j) = 0 - part_abs_pos(j) = 0 - part_abs_turn(j) = 0 - part_select(j) = 1 - part_indiv(j) = -c1m6 - part_linteract(j) = zero - part_impact(j) = 0 - nabs_type(j) = 0 - nhit_stage(j) = 0 - end do - -#ifdef BEAMGAS -!YIL call beam gas initiation routine - call beamGasInit(myenom) -#endif - - write(lout,"(a)") "" - write(lout,"(a,i0)") "COLL> Number of collimators: ",cdb_nColl - do icoll = 1, cdb_nColl - write(lout,"(a,i5,a)") "COLL> Collimator ",icoll,": "//cdb_cName(icoll) - end do - write(lout,"(a)") "" - -!******write settings for alignment error in colltrack.out file - write(outlun,*) ' ' - write(outlun,*) 'Alignment errors settings (tilt, offset,...)' - write(outlun,*) ' ' - write(outlun,*) 'SETTING> c_rmstilt_prim : ', c_rmstilt_prim - write(outlun,*) 'SETTING> c_rmstilt_sec : ', c_rmstilt_sec - write(outlun,*) 'SETTING> c_systilt_prim : ', c_systilt_prim - write(outlun,*) 'SETTING> c_systilt_sec : ', c_systilt_sec - write(outlun,*) 'SETTING> c_rmsoffset_prim : ', c_rmsoffset_prim - write(outlun,*) 'SETTING> c_rmsoffset_sec : ', c_rmsoffset_sec - write(outlun,*) 'SETTING> c_sysoffset_prim : ', c_sysoffset_prim - write(outlun,*) 'SETTING> c_sysoffset_sec : ', c_sysoffset_sec - write(outlun,*) 'SETTING> c_offsettilt seed: ', c_offsettilt_seed - write(outlun,*) 'SETTING> c_rmserror_gap : ', c_rmserror_gap - write(outlun,*) 'SETTING> do_mingap : ', do_mingap - write(outlun,*) ' ' - -! TW - 01/2007 -! added offset and random_seed for tilt and offset -!*****intialize random generator with offset_seed - c_offsettilt_seed = abs(c_offsettilt_seed) - rnd_lux = 3 - rnd_k1 = 0 - rnd_k2 = 0 - call rluxgo(rnd_lux, c_offsettilt_seed, rnd_k1, rnd_k2) + use coll_common - ! Generate random tilts (Gaussian distribution plus systematic) - if(c_rmstilt_prim > zero .or. c_rmstilt_sec > zero .or. c_systilt_prim /= zero .or. c_systilt_sec /= zero) then - do icoll = 1, cdb_nColl - if(cdb_cStage(icoll) == cdb_stgPrimary) then - c_rmstilt = c_rmstilt_prim - c_systilt = c_systilt_prim - else - c_rmstilt = c_rmstilt_sec - c_systilt = c_systilt_sec - end if - cdb_cTilt(1,icoll) = c_systilt+c_rmstilt*ran_gauss2(three) - if(systilt_antisymm) then - cdb_cTilt(2,icoll) = -one*c_systilt+c_rmstilt*ran_gauss2(three) - else - cdb_cTilt(2,icoll) = c_systilt+c_rmstilt*ran_gauss2(three) - end if - write(outlun,*) 'INFO> Collimator ',trim(cdb_cName(icoll)),' jaw 1 has tilt [rad]: ',cdb_cTilt(1,icoll) - write(outlun,*) 'INFO> Collimator ',trim(cdb_cName(icoll)),' jaw 2 has tilt [rad]: ',cdb_cTilt(2,icoll) - end do + integer j + real(kind=fPrec) gammax,gammay,xj,xpj,yj,ypj,pj,nspx,nspy - do icoll=1,cdb_nColl - if(cdb_cStage(icoll) == cdb_stgPrimary) then - cdb_cOffset(icoll) = c_sysoffset_prim + c_rmsoffset_prim*ran_gauss2(three) - else - cdb_cOffset(icoll) = c_sysoffset_sec + c_rmsoffset_sec*ran_gauss2(three) - end if - write(outlun,*) 'INFO> Offset: ',trim(cdb_cName(icoll)),cdb_cOffset(icoll) - end do + if(dowrite_amplitude .eqv. .false.) then + ! We're not writing the amplitude.dat file anyway, so return here. + ! It shouldn't be called anyway, but just to make sure we don't segfault if it does. + return end if - do icoll=1,cdb_nColl - gap_rms_error(icoll) = c_rmserror_gap * ran_gauss2(three) - write(outlun,*) 'INFO> Gap RMS error: ',trim(cdb_cName(icoll)),gap_rms_error(icoll) - end do - - ! In case we're using old type jaw fit, this is where we generate the parameters for the new method - ! After this, the number of slices is also stored per collimator, and can be extracted again later - call cdb_setMasterJawFit(n_slices, smin_slices, smax_slices, recenter1, recenter2, jaw_fit, jaw_ssf) -!---- creating a file with beta-functions at TCP/TCS - mingap = 20 + gammax = (one + talphax(ie)**2)/tbetax(ie) + gammay = (one + talphay(ie)**2)/tbetay(ie) - do j=1,iu - ! this transformation gives the right marker/name to the corresponding beta-functions or vice versa - if(ic(j) <= nblo) then - myix = mtyp(ic(j),mel(ic(j))) - else - myix = ic(j)-nblo - end if + if(firstrun .and. iturn == 1) then + sum_ax(ie) = zero + sum_ay(ie) = zero + end if - if(cdb_elemMap(myix) > 0) then - nsig = cdb_cNSig(cdb_elemMap(myix)) + do j=1,napx + xj = (xv1(j)-torbx(ie))/c1e3 + xpj = (yv1(j)-torbxp(ie))/c1e3 + yj = (xv2(j)-torby(ie))/c1e3 + ypj = (yv2(j)-torbyp(ie))/c1e3 + pj = ejv(j)/c1e3 + + if(part_abs_pos(j) == 0 .and. part_abs_turn(j) == 0) then + nspx = sqrt(abs((gammax*(xj)**2 + ((two*talphax(ie))*xj)*xpj) + tbetax(ie)*xpj**2)/c_emitx0_collgap) + nspy = sqrt(abs((gammay*(yj)**2 + ((two*talphay(ie))*yj)*ypj) + tbetay(ie)*ypj**2)/c_emity0_collgap) + sum_ax(ie) = sum_ax(ie) + nspx + sqsum_ax(ie) = sqsum_ax(ie) + nspx**2 + sum_ay(ie) = sum_ay(ie) + nspy + sqsum_ay(ie) = sqsum_ay(ie) + nspy**2 + nampl(ie) = nampl(ie) + 1 else - nsig = cdb_defColGap + nspx = zero + nspy = zero end if - - do i=1,cdb_nColl - ! start searching minimum gap - if(cdb_cName(i) == bez(myix)) then - if(cdb_cLength(i) > zero) then - nsig_err = nsig + gap_rms_error(i) - - ! jaw 1 on positive side x-axis - gap_h1 = nsig_err - sin_mb(cdb_cTilt(1,i))*cdb_cLength(i)/2 - gap_h2 = nsig_err + sin_mb(cdb_cTilt(1,i))*cdb_cLength(i)/2 - - ! jaw 2 on negative side of x-axis (see change of sign comapred - ! to above code lines, alos have a look to setting of tilt angle) - gap_h3 = nsig_err + sin_mb(cdb_cTilt(2,i))*cdb_cLength(i)/2 - gap_h4 = nsig_err - sin_mb(cdb_cTilt(2,i))*cdb_cLength(i)/2 - - if(do_nominal) then - bx_dist = cdb_cBx(icoll) - by_dist = cdb_cBy(icoll) - else - bx_dist = tbetax(j) - by_dist = tbetay(j) - end if - - sig_offset = cdb_cOffset(i)/(sqrt(bx_dist**2 * cos_mb(cdb_cRotation(i))**2 + by_dist**2 * sin_mb(cdb_cRotation(i))**2)) - write(coll_twissLikeUnit,*) cdb_cName(i),tbetax(j),tbetay(j),torbx(j),torby(j),nsig,gap_rms_error(i) - write(coll_sigmaSetUnit,*) cdb_cName(i),gap_h1,gap_h2,gap_h3,gap_h4,sig_offset,cdb_cOffset(i),nsig,gap_rms_error(i) - - if((gap_h1 + sig_offset) <= mingap) then - mingap = gap_h1 + sig_offset - coll_mingap_id = i - coll_mingap2 = cdb_cName(i) - else if((gap_h2 + sig_offset) <= mingap) then - mingap = gap_h2 + sig_offset - coll_mingap_id = i - coll_mingap2 = cdb_cName(i) - else if((gap_h3 - sig_offset) <= mingap) then - mingap = gap_h3 - sig_offset - coll_mingap_id = i - coll_mingap2 = cdb_cName(i) - else if((gap_h4 - sig_offset) <= mingap) then - mingap = gap_h4 - sig_offset - coll_mingap_id = i - coll_mingap2 = cdb_cName(i) - end if - end if - end if - end do !do i = 1, cdb_nColl - - end do !do j=1,iu - - write(coll_twissLikeUnit,*) coll_mingap_id, coll_mingap2, mingap - write(coll_twissLikeUnit,*) 'INFO> IPENCIL initial ', ipencil - -! if pencil beam is used and on collimator with smallest gap the -! distribution should be generated, set ipencil to coll_mingap_id - if (ipencil.gt.0 .and. do_mingap) then - ipencil = coll_mingap_id - end if - - write(coll_twissLikeUnit,*) 'INFO> IPENCIL new (if do_mingap) ', ipencil - write(coll_sigmaSetUnit,*) coll_mingap_id, coll_mingap2, mingap - -! if pencil beam is used and on collimator with smallest gap the -! distribution should be generated, set ipencil to coll_mingap_id - write(coll_sigmaSetUnit,*) 'INFO> IPENCIL new (if do_mingap) ',ipencil - write(coll_sigmaSetUnit,*) 'INFO> rnd_seed is (before reinit)',rnd_seed - - call f_close(coll_twissLikeUnit) - call f_close(coll_sigmaSetUnit) - -!****** re-intialize random generator with rnd_seed -! reinit with initial value used in first call - - ! This sets the random geenrator back to the default seed rather than the one used for coll gaps. - ! However, this doesn't actually restore the random generator to the state it would have been in without the - ! coll gaps errors being generated as rndm5() will extract 30000 new random numbers from ranlux and discard - ! the ones it already holds and would have used. - ! Alternatively, we can use ranecu instead, which is capable of continuing a chain of random numbers from - ! a given set of seeds. - ! It is probably unnecessary to use different random seeds here in the first place. - rnd_lux = 3 - rnd_k1 = 0 - rnd_k2 = 0 - call rluxgo(rnd_lux, rnd_seed, rnd_k2, rnd_k2) -! call recuin(rnd_seed, 0) - dummy = rndm5(1) ! Reset rndm5 too - -!GRD INITIALIZE LOCAL ADDITIVE PARAMETERS, I.E. THE ONE WE DON'T WANT -!GRD TO KEEP OVER EACH LOOP - do k = 1, numeff - neff(k) = zero - neffx(k) = zero - neffy(k) = zero - - do j = 1, numeffdpop - neff2d(k,j) = zero - end do - end do - - do k = 1, numeffdpop - neffdpop(k) = zero - npartdpop(k) = 0 - end do - - do j=1,max_ncoll - cn_impact(j) = 0 - cn_absorbed(j) = 0 - csum(j) = zero - csqsum(j) = zero end do -end subroutine collimate_start +end subroutine coll_computeStats ! ================================================================================================ ! -! V.K. Berglyd Olsen, BE-ABP-HSS -! Created: 2019-09-11 -! Updated: 2019-09-11 -! Wrapper routine for main collimation call in tracking. +! The routine that calls the actual scattering modules for a collimator ! ================================================================================================ ! -subroutine collimate_trackThin(stracki, isColl) +subroutine coll_doCollimator(stracki) + use crcoall use mod_time use mod_common - use mod_common_main - use mod_common_track - - real(kind=fPrec), intent(in) :: stracki - logical, intent(in) :: isColl - - integer j - - if(isColl) then - - call time_startClock(time_clockCOLL) - call collimate_start_collimator(stracki) - call collimate_do_collimator(stracki) - call collimate_end_collimator(stracki) - call time_stopClock(time_clockCOLL) - - else - - gammax = (one + talphax(ie)**2)/tbetax(ie) - gammay = (one + talphay(ie)**2)/tbetay(ie) - - if(firstrun .and. iturn == 1) then - sum_ax(ie) = zero - sum_ay(ie) = zero - end if - - do j=1,napx - xj = (xv1(j)-torbx(ie))/c1e3 - xpj = (yv1(j)-torbxp(ie))/c1e3 - yj = (xv2(j)-torby(ie))/c1e3 - ypj = (yv2(j)-torbyp(ie))/c1e3 - pj = ejv(j)/c1e3 - - if(part_abs_pos(j) == 0 .and. part_abs_turn(j) == 0) then - nspx = sqrt(abs(gammax*(xj)**2 + two*talphax(ie)*xj*xpj + tbetax(ie)*xpj**2)/myemitx0_collgap) - nspy = sqrt(abs(gammay*(yj)**2 + two*talphay(ie)*yj*ypj + tbetay(ie)*ypj**2)/myemity0_collgap) - sum_ax(ie) = sum_ax(ie) + nspx - sqsum_ax(ie) = sqsum_ax(ie) + nspx**2 - sum_ay(ie) = sum_ay(ie) + nspy - sqsum_ay(ie) = sqsum_ay(ie) + nspy**2 - nampl(ie) = nampl(ie) + 1 - else - nspx = zero - nspy = zero - end if - end do - - end if - -end subroutine collimate_trackThin - -! ================================================================================================ ! -! Updated: 2019-09-12 -! Called when we enter a collimator. -! The routine doesn't check that the collimator exists! This should be checked before calling it. -! ================================================================================================ ! -subroutine collimate_start_collimator(stracki) - - use coll_db - use mod_common - use mod_common_main - use mod_common_track - - real(kind=fPrec), intent(in) :: stracki - - integer j - - icoll = cdb_elemMap(myix) - nsig = cdb_cNSig(icoll) - c_length = zero - - ! SR, 23-11-2005: To avoid binary entries in 'amplitude.dat' - if(firstrun) then - - gammax = (one + talphax(ie)**2)/tbetax(ie) - gammay = (one + talphay(ie)**2)/tbetay(ie) - - if(iturn == 1) then - sum_ax(ie) = zero - sum_ay(ie) = zero - end if - - do j=1,napx - xj = (xv1(j)-torbx(ie))/c1e3 - xpj = (yv1(j)-torbxp(ie))/c1e3 - yj = (xv2(j)-torby(ie))/c1e3 - ypj = (yv2(j)-torbyp(ie))/c1e3 - pj = ejv(j)/c1e3 - - ! DRIFT PART - if(stracki == zero) then - if(iexact) then - zpj = sqrt(one-xpj**2-ypj**2) - xj = xj + half*c_length*(xpj/zpj) - yj = yj + half*c_length*(ypj/zpj) - else - xj = xj + half*c_length*xpj - yj = yj + half*c_length*ypj - end if - end if - - if(part_abs_pos(j) == 0 .and. part_abs_turn(j) == 0) then - nspx = sqrt(abs(gammax*xj**2 + two*talphax(ie)*xj*xpj +tbetax(ie)*xpj**2)/myemitx0_collgap) - nspy = sqrt(abs(gammay*yj**2 + two*talphay(ie)*yj*ypj +tbetay(ie)*ypj**2)/myemity0_collgap) - sum_ax(ie) = sum_ax(ie) + nspx - sqsum_ax(ie) = sqsum_ax(ie) + nspx**2 - sum_ay(ie) = sum_ay(ie) + nspy - sqsum_ay(ie) = sqsum_ay(ie) + nspy**2 - nampl(ie) = nampl(ie) + 1 - else - nspx = zero - nspy = zero - end if - end do - end if - -end subroutine collimate_start_collimator - -!> -!! collimate_do_collimator() -!! This routine is calls the actual scattering functions -!< -subroutine collimate_do_collimator(stracki) - - use crcoall - use parpro use coll_common - use mod_common - use mod_commons - use mod_common_da use mod_common_main use mod_common_track - use numerical_constants, only : c5m4 use coll_db use coll_k2 use coll_jawfit @@ -2012,62 +1514,57 @@ subroutine collimate_do_collimator(stracki) use coll_crystal use mod_units use mathlib_bouncer - use mod_alloc use string_tools -#ifdef ROOT - use root_output -#endif #ifdef G4COLLIMATION use geant4 #endif - implicit none - real(kind=fPrec), intent(in) :: stracki integer j, iSlice, nSlices - logical onesided, linside(napx), isHit, isAbs - real(kind=fPrec) jawLength, jawAperture, jawOffset, jawTilt(2) - real(kind=fPrec) x_Dump,xpDump,y_Dump,ypDump,s_Dump - real(kind=fPrec) cry_tilt + logical onesided, linside(napx), isAbs, isHit + real(kind=fPrec) nsig,c_length,jawLength,jawAperture,jawOffset,jawTilt(2),x_Dump,xpDump,y_Dump, & + ypDump,s_Dump,xmax,ymax,calc_aperture,zpj,xmax_pencil,ymax_pencil,xmax_nom,ymax_nom, & + nom_aperture,scale_bx,scale_by,c_tilt(2),c_offset,c_aperture,c_rotation,cry_bendangle,cry_tilt, & + cRot,sRot -#ifdef G4COLLIMATION - integer :: g4_lostc - integer :: g4_npart - integer :: part_hit_flag = 0 - integer :: part_abs_flag = 0 - real(kind=fPrec) x_tmp,y_tmp,xp_tmp,yp_tmp + call time_startClock(time_clockCOLL) - ! ien0,ien1: ion energy entering/leaving the collimator - ! energy in MeV - real(kind=fPrec) :: ien0, ien1 - integer(kind=int16) :: nnuc0,nnuc1 -#endif + ! Get collimator values from DB + icoll = cdb_elemMap(c_ix) + nsig = cdb_cNSig(icoll) + c_rotation = cdb_cRotation(icoll) + c_length = cdb_cLength(icoll) + c_offset = cdb_cOffset(icoll) + c_tilt(:) = cdb_cTilt(:,icoll) + cRot = cos_mb(c_rotation) + sRot = sin_mb(c_rotation) + if(firstrun .and. dowrite_amplitude) then + call coll_computeStats + end if -!----------------------------------------------------------------------- -!GRD NEW COLLIMATION PARAMETERS -!----------------------------------------------------------------------- -!++ Get the aperture from the beta functions and emittance -!++ A simple estimate of beta beating can be included that -!++ has twice the betatron phase advance - if(.not. cdb_doNSig) nsig = cdb_cNSig(icoll) + ! Get the aperture from the beta functions and emittance + ! A simple estimate of beta beating can be included that has twice the betatron phase advance + if(.not. cdb_doNSig) then + nsig = cdb_cNSig(icoll) + end if - scale_bx = (one + xbeat*sin_mb(four*pi*mux(ie)+xbeatphase) ) - scale_by = (one + ybeat*sin_mb(four*pi*muy(ie)+ybeatphase) ) + scale_bx = one + xbeat*sin_mb(xbeatphase) + scale_by = one + ybeat*sin_mb(ybeatphase) if(firstcoll) then scale_bx0 = scale_bx scale_by0 = scale_by firstcoll = .false. end if -!------------------------------------------------------------------- -!++ Assign nominal OR design beta functions for later + + ! Assign nominal OR design beta functions for later if(do_nominal) then - bx_dist = cdb_cBx(icoll) * scale_bx / scale_bx0 - by_dist = cdb_cBy(icoll) * scale_by / scale_by0 + bx_dist = (cdb_cBx(icoll)*scale_bx)/scale_bx0 + by_dist = (cdb_cBy(icoll)*scale_by)/scale_by0 else - bx_dist = tbetax(ie) * scale_bx / scale_bx0 - by_dist = tbetay(ie) * scale_by / scale_by0 + bx_dist = (tbetax(ie)*scale_bx)/scale_bx0 + by_dist = (tbetay(ie)*scale_by)/scale_by0 end if ! Write beam ellipse at selected collimator @@ -2095,67 +1592,41 @@ subroutine collimate_do_collimator(stracki) write(outlun,*) 'Optics beta y [m]: ', tbetay(ie) end if -!------------------------------------------------------------------- -!++ Calculate aperture of collimator -!JUNE2005 HERE ONE HAS TO HAVE PARTICULAR TREATMENT OF THE OPENING OF -!JUNE2005 THE PRIMARY COLLIMATOR OF RHIC - nsig = nsig + gap_rms_error(icoll) - xmax = nsig*sqrt(bx_dist*myemitx0_collgap) - ymax = nsig*sqrt(by_dist*myemity0_collgap) - xmax_pencil = (nsig+pencil_offset)*sqrt(bx_dist*myemitx0_collgap) - ymax_pencil = (nsig+pencil_offset)*sqrt(by_dist*myemity0_collgap) - xmax_nom = cdb_cNSig(icoll)*sqrt(cdb_cBx(icoll)*myemitx0_collgap) - ymax_nom = cdb_cNSig(icoll)*sqrt(cdb_cBy(icoll)*myemity0_collgap) - c_rotation = cdb_cRotation(icoll) - c_length = cdb_cLength(icoll) - c_material = cdb_cMaterial(icoll) - c_offset = cdb_cOffset(icoll) - c_tilt(1) = cdb_cTilt(1,icoll) - c_tilt(2) = cdb_cTilt(2,icoll) + ! Calculate aperture of collimator + nsig = nsig + gap_rms_error(icoll) + xmax = nsig*sqrt(bx_dist*c_emitx0_collgap) + ymax = nsig*sqrt(by_dist*c_emity0_collgap) + xmax_pencil = (nsig + pencil_offset)*sqrt(bx_dist*c_emitx0_collgap) + ymax_pencil = (nsig + pencil_offset)*sqrt(by_dist*c_emity0_collgap) + xmax_nom = cdb_cNSig(icoll)*sqrt(cdb_cBx(icoll)*c_emitx0_collgap) + ymax_nom = cdb_cNSig(icoll)*sqrt(cdb_cBy(icoll)*c_emity0_collgap) + + cry_proc(:) = -1 - calc_aperture = sqrt( xmax**2 * cos_mb(c_rotation)**2 + ymax**2 * sin_mb(c_rotation)**2 ) - nom_aperture = sqrt( xmax_nom**2 * cos_mb(c_rotation)**2 + ymax_nom**2 * sin_mb(c_rotation)**2 ) - pencil_aperture = sqrt( xmax_pencil**2 * cos_mb(c_rotation)**2+ ymax_pencil**2 * sin_mb(c_rotation)**2 ) + calc_aperture = sqrt( xmax**2*cRot**2 + ymax**2*sRot**2) + nom_aperture = sqrt(xmax_nom**2*cRot**2 + ymax_nom**2*sRot**2) -!++ Get x and y offsets at collimator center point - x_pencil(icoll) = xmax_pencil * (cos_mb(c_rotation)) - y_pencil(icoll) = ymax_pencil * (sin_mb(c_rotation)) + ! Get x and y offsets at collimator center point + x_pencil(icoll) = xmax_pencil * cRot + y_pencil(icoll) = ymax_pencil * sRot -!++ Get corresponding beam angles (uses xp_max) - xp_pencil(icoll) = -one * sqrt(myemitx0_collgap/tbetax(ie))*talphax(ie)* xmax / sqrt(myemitx0_collgap*tbetax(ie)) - yp_pencil(icoll) = -one * sqrt(myemity0_collgap/tbetay(ie))*talphay(ie)* ymax / sqrt(myemity0_collgap*tbetay(ie)) + ! Get corresponding beam angles (uses xp_max) + xp_pencil(icoll) = (((-one*sqrt(c_emitx0_collgap/tbetax(ie)))*talphax(ie))*xmax)/sqrt(c_emitx0_collgap*tbetax(ie)) + yp_pencil(icoll) = (((-one*sqrt(c_emity0_collgap/tbetay(ie)))*talphay(ie))*ymax)/sqrt(c_emity0_collgap*tbetay(ie)) xp_pencil0 = xp_pencil(icoll) yp_pencil0 = yp_pencil(icoll) - pencil_dx(icoll) = sqrt(xmax_pencil**2 * cos_mb(c_rotation)**2 + ymax_pencil**2 * sin_mb(c_rotation)**2)-calc_aperture - -!++ TW -- tilt for of jaw for pencil beam -!++ as in Ralphs orig routine, but not in collimate subroutine itself -! nprim = 3 -! if ( (icoll.eq.ipencil) & -! & icoll.le.nprim .and. (j.ge.(icoll-1)*nev/nprim) & -! & .and. (j.le.(icoll)*nev/nprim))) then -! this is done for every bunch (64 particle bucket) -! important: Sixtrack calculates in "mm" and k2coll_collimate in "m" -! therefore 1E-3 is used to - -! RB: added condition that pencil_distr.ne.3 in order to do the tilt - if((icoll.eq.ipencil).and.(iturn.eq.1).and. (pencil_distr.ne.3)) then -!! write(*,*) " ************************************** " -!! write(*,*) " * INFO> seting tilt for pencil beam * " -!! write(*,*) " ************************************** " - -!! respects if the tilt symmetric or not, for systilt_antiymm c_tilt is -!! -systilt + rmstilt otherwise +systilt + rmstilt -!! if (systilt_antisymm) then -!! to align the jaw/pencil to the beam always use the minus regardless which -!! orientation of the jaws was used (symmetric/antisymmetric) - c_tilt(1) = c_tilt(1) + (xp_pencil0*cos_mb(c_rotation) + sin_mb(c_rotation)*yp_pencil0) - c_tilt(2) = c_tilt(2) -one*(xp_pencil0*cos_mb(c_rotation) + sin_mb(c_rotation)*yp_pencil0) + pencil_dx(icoll) = sqrt(xmax_pencil**2 * cRot**2 + ymax_pencil**2 * sRot**2) - calc_aperture + + ! Added condition that pencil_distr /= 3 in order to do the tilt + if(icoll == ipencil .and. iturn == 1 .and. pencil_distr /= 3) then + ! To align the jaw/pencil to the beam always use the minus regardless which + ! orientation of the jaws was used (symmetric/antisymmetric) + c_tilt(1) = c_tilt(1) + (xp_pencil0 * cRot + sRot * yp_pencil0) + c_tilt(2) = c_tilt(2) - (xp_pencil0 * cRot + sRot * yp_pencil0) write(lout,*) "INFO> Changed tilt1 ICOLL to ANGLE ", icoll, c_tilt(1) write(lout,*) "INFO> Changed tilt2 ICOLL to ANGLE ", icoll, c_tilt(2) end if -!++ TW -- tilt angle changed (added to genetated on if spec. in fort.3) ! Extract number of jaw fit slices for this collimator if(cdb_cSliced(icoll) > 0) then ! Collimator is sliced @@ -2174,8 +1645,8 @@ subroutine collimate_do_collimator(stracki) if(iturn == 1) then write(outlun,*) xp_pencil(icoll), yp_pencil(icoll), pencil_dx(icoll) write(outlun,'(a,i4)') 'Collimator number: ', icoll - write(outlun,*) 'Beam size x [m]: ', sqrt(tbetax(ie)*myemitx0_collgap), "(from collgap emittance)" - write(outlun,*) 'Beam size y [m]: ', sqrt(tbetay(ie)*myemity0_collgap), "(from collgap emittance)" + write(outlun,*) 'Beam size x [m]: ', sqrt(tbetax(ie)*c_emitx0_collgap), "(from collgap emittance)" + write(outlun,*) 'Beam size y [m]: ', sqrt(tbetay(ie)*c_emity0_collgap), "(from collgap emittance)" write(outlun,*) 'Divergence x [urad]: ', c1e6*xp_pencil(icoll) write(outlun,*) 'Divergence y [urad]: ', c1e6*yp_pencil(icoll) write(outlun,*) 'Aperture (nom) [m]: ', nom_aperture @@ -2186,8 +1657,8 @@ subroutine collimate_do_collimator(stracki) write(coll_gapsUnit,"(i4,1x,a16,4(1x,e19.10),1x,a4,5(1x,e13.5),1x,f13.6)") & icoll,cdb_cName(icoll)(1:16),cdb_cRotation(icoll),tbetax(ie),tbetay(ie),calc_aperture, & - cdb_cMaterial(icoll),cdb_cLength(icoll),sqrt(tbetax(ie)*myemitx0_collgap), & - sqrt(tbetay(ie)*myemity0_collgap),cdb_cTilt(1,icoll),cdb_cTilt(2,icoll),nsig + cdb_cMaterial(icoll),cdb_cLength(icoll),sqrt(tbetax(ie)*c_emitx0_collgap), & + sqrt(tbetay(ie)*c_emity0_collgap),cdb_cTilt(1,icoll),cdb_cTilt(2,icoll),nsig ! Write to coll settings file if we have 0 or 1 slices if(nSlices <= 1) then @@ -2198,143 +1669,21 @@ subroutine collimate_do_collimator(stracki) end if c_aperture = two*calc_aperture -! IF(IPENCIL.GT.zero) THEN -! C_APERTURE = 2.*pencil_aperture - -! RB: addition matched halo sampled directly on the TCP using pencil beam flag -!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!! - if ((iturn.eq.1).and.(ipencil.eq.icoll).and.(pencil_distr.eq.3)) then - -! create distribution where the normalized distance between jaw and beam is the smallest -! - this is where particles will first impact: -! without imperfections, it is: -! -- at the face of the collimator for the case of beta'<0 (POSITIVE alpha - beam converging) and -! -- at the exit of the collimator for the case of beta'>0 (NEGATIVE alpha beam diverging) - -! with imperfections: include errors on gap, tilt and offset. We have to calculate the normalized distance -! to each corner separately! - -! First: calculate optical parameters at start and end of collimator (half a collimator length upstream and -! downstream of present s-position) -! Assuming a purely vertical or horizontal halo - need to add more conditions for other cases! - -! Using standard twiss transfer matrix for a drift : ( new_halo_model_checks.nb ) -! at start of collimator: - ldrift = -c_length / two !Assign the drift length over which the optics functions are propagated - betax1 = tbetax(ie) - two*ldrift*talphax(ie) + (ldrift**2 * (one+talphax(ie)**2))/tbetax(ie) - betay1 = tbetay(ie) - two*ldrift*talphay(ie) + (ldrift**2 * (one+talphay(ie)**2))/tbetay(ie) - - alphax1 = talphax(ie) - (ldrift*(1+talphax(ie)**2))/tbetax(ie) - alphay1 = talphay(ie) - (ldrift*(1+talphay(ie)**2))/tbetay(ie) - -! at end of collimator: - ldrift = c_length / two - betax2 = tbetax(ie) - two*ldrift*talphax(ie) + (ldrift**2 * (one+talphax(ie)**2))/tbetax(ie) - betay2 = tbetay(ie) - two*ldrift*talphay(ie) + (ldrift**2 * (one+talphay(ie)**2))/tbetay(ie) - - alphax2 = talphax(ie) - (ldrift*(1+talphax(ie)**2))/tbetax(ie) - alphay2 = talphay(ie) - (ldrift*(1+talphay(ie)**2))/tbetay(ie) - -! calculate beam size at start and end of collimator. account for collimation plane - if((cdist_ampX.gt.0).and.(cdist_ampY.eq.zero)) then ! horizontal halo - beamsize1 = sqrt(betax1 * myemitx0_collgap) - beamsize2 = sqrt(betax2 * myemitx0_collgap) - else if((cdist_ampX.eq.0).and.(cdist_ampY.gt.zero)) then ! vertical halo - beamsize1 = sqrt(betay1 * myemity0_collgap) - beamsize2 = sqrt(betay2 * myemity0_collgap) - else - write(lerr,"(a)") "COLL> ERROR Attempting to use a halo not purely in the horizontal "//& - "or vertical plane with pencil_dist=3 - abort." - call prror - end if -! calculate offset from tilt of positive and negative jaws, at start and end -! remember: tilt angle is defined such that one corner stays at nominal position, the other corner is more open - -! jaw in positive x (or y): - if(c_tilt(1).ge.0) then - tiltOffsPos1 = zero - tiltOffsPos2 = abs(sin_mb(c_tilt(1))) * c_length - else - tiltOffsPos1 = abs(sin_mb(c_tilt(1))) * c_length - tiltOffsPos2 = zero - end if - -! jaw in negative x (or y): - if(c_tilt(2).ge.0) then - tiltOffsNeg1 = abs(sin_mb(c_tilt(2))) * c_length - tiltOffsNeg2 = zero - else - tiltOffsNeg1 = zero - tiltOffsNeg2 = abs(sin_mb(c_tilt(2))) * c_length - end if - -! calculate half distance from jaws to beam center (in units of beam sigma) at the beginning of the collimator, -! positive and neg jaws. - Nap1pos=((c_aperture/two + c_offset) + tiltOffsPos1)/beamsize1 - Nap2pos=((c_aperture/two + c_offset) + tiltOffsPos2)/beamsize2 - Nap1neg=((c_aperture/two - c_offset) + tiltOffsNeg1)/beamsize1 - Nap2neg=((c_aperture/two - c_offset) + tiltOffsNeg2)/beamsize2 - -! Minimum normalized distance from jaw to beam center - this is the n_sigma at which the halo should be generated - minAmpl = min(Nap1pos,Nap2pos,Nap1neg,Nap2neg) - -! Assign amplitudes in x and y for the halo generation function - if((cdist_ampX.gt.0).and.(cdist_ampY.eq.zero)) then ! horizontal halo - mynex2 = minAmpl - else if((cdist_ampX.eq.0).and.(cdist_ampY.gt.zero)) then ! vertical halo - myney2 = minAmpl - end if ! other cases taken care of above - in these cases, program has already stopped - -! assign optics parameters to use for the generation of the starting halo - at start or end of collimator - if((minAmpl.eq.Nap1pos).or.(minAmpl.eq.Nap1neg)) then ! min normalized distance occurs at start of collimator - mybetax=betax1 - mybetay=betay1 - myalphax=alphax1 - myalphay=alphay1 - ldrift = -c_length / two - else ! min normalized distance occurs at end of collimator - mybetax=betax2 - mybetay=betay2 - myalphax=alphax2 - myalphay=alphay2 - ldrift = c_length / two - end if - -! create new pencil beam distribution with spread at start or end of collimator at the minAmpl -! note: if imperfections are active, equal amounts of particles are still generated on the two jaws. -! but it might be then that only one jaw is hit on the first turn, thus only by half of the particles -! the particle generated on the other side will then hit the same jaw several turns later, possibly smearing the impact parameter -! This could possibly be improved in the future. - call cdist_makeDist_coll(myalphax,myalphay,mybetax,mybetay,mynex2,myney2) - - do j = 1, napx - xv1(j) = c1e3*xv1(j) + torbx(ie) - yv1(j) = c1e3*yv1(j) + torbxp(ie) - xv2(j) = c1e3*xv2(j) + torby(ie) - yv2(j) = c1e3*yv2(j) + torbyp(ie) - -! as main routine will track particles back half a collimator length (to start of jaw), -! track them now forward (if generated at face) or backward (if generated at end) -! 1/2 collimator length to center of collimator (ldrift pos or neg) - xv1(j) = xv1(j) - ldrift*yv1(j) - xv2(j) = xv2(j) - ldrift*yv2(j) - end do + ! Addition matched halo sampled directly on the TCP using pencil beam flag + if(iturn == 1 .and. ipencil == icoll .and. pencil_distr == 3) then + call coll_matchedHalo(c_tilt,c_offset,c_aperture,c_length) end if -!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!! -! end RB addition - -!++ Copy particle data to 1-dim array and go back to meters + ! Copy particle data to 1-dim array and go back to meters do j=1,napx - rcx(j) = (xv1(j)-torbx(ie)) /c1e3 - rcxp(j) = (yv1(j)-torbxp(ie))/c1e3 - rcy(j) = (xv2(j)-torby(ie)) /c1e3 - rcyp(j) = (yv2(j)-torbyp(ie))/c1e3 - rcp(j) = ejv(j)/c1e3 - rcs(j) = zero - part_hit_before_turn(j) = part_hit_turn(j) - part_hit_before_pos(j) = part_hit_pos(j) + rcx(j) = (xv1(j)-torbx(ie)) /c1e3 + rcxp(j) = (yv1(j)-torbxp(ie))/c1e3 + rcy(j) = (xv2(j)-torby(ie)) /c1e3 + rcyp(j) = (yv2(j)-torbyp(ie))/c1e3 + rcp(j) = ejv(j)/c1e3 + rcs(j) = zero + rcx0(j) = rcx(j) rcxp0(j) = rcxp(j) rcy0(j) = rcy(j) @@ -2344,9 +1693,9 @@ subroutine collimate_do_collimator(stracki) ! For zero length element track back half collimator length ! DRIFT PART - if(stracki == 0) then + if(stracki == zero) then if(iexact) then - zpj=sqrt(one-rcxp(j)**2-rcyp(j)**2) + zpj = sqrt(one - rcxp(j)**2 - rcyp(j)**2) rcx(j) = rcx(j) - (half*c_length)*(rcxp(j)/zpj) rcy(j) = rcy(j) - (half*c_length)*(rcyp(j)/zpj) else @@ -2359,21 +1708,13 @@ subroutine collimate_do_collimator(stracki) end if end do -!++ Do the collimation tracking - enom_gev = myenom*c1m3 - ! Allow treatment of collimators as one-sided - if(cdb_cSides(icoll) == 1) then - onesided = .true. - else if(cdb_cSides(icoll) == 2) then - onesided = .true. - else - onesided = .false. - end if + onesided = cdb_cSides(icoll) == 1 .or. cdb_cSides(icoll) == 2 linside(:) = .false. if(cdb_cSliced(icoll) > 0) then ! Treatment of sliced collimators + ! Now, loop over the number of slices and call k2coll_collimate each time. ! For each slice, the corresponding offset and angle are to be used. if(cdb_isCrystal(icoll)) then @@ -2386,11 +1727,11 @@ subroutine collimate_do_collimator(stracki) jawTilt = c_tilt call jaw_getFitSliceValues(cdb_cSliced(icoll), iSlice, jawLength, jawAperture, jawOffset, jawTilt) if(firstrun) then - write(coll_settingsUnit,"(a20,1x,i10,5(1x,1pe13.6),1x,a)") cdb_cName(icoll)(1:20), iSlice, & + write(coll_settingsUnit,"(a20,1x,i10,5(1x,1pe13.6),1x,a)") cdb_cName(icoll)(1:20), iSlice, & jawAperture/two, jawOffset, jawTilt(1), jawTilt(2), jawLength, cdb_cMaterial(icoll) end if call k2coll_collimate(icoll, iturn, ie, jawLength, c_rotation, jawAperture, & - jawOffset, jawTilt, rcx, rcxp, rcy, rcyp, rcp, rcs, enom_gev, part_hit_pos, & + jawOffset, jawTilt, rcx, rcxp, rcy, rcyp, rcp, rcs, c_enom*c1m3, part_hit_pos, & part_hit_turn, part_abs_pos, part_abs_turn, part_impact, part_indiv, part_linteract, & onesided, nhit_stage, iSlice, nabs_type, linside) end do @@ -2398,645 +1739,222 @@ subroutine collimate_do_collimator(stracki) else ! Treatment of non-sliced collimators #ifndef G4COLLIMATION + if(cdb_isCrystal(icoll)) then + call cry_startElement(icoll,ie,c_emitx0_dist,c_emity0_dist,cry_tilt,c_length) + end if + call k2coll_collimate(icoll, iturn, ie, c_length, c_rotation, c_aperture, c_offset, & + c_tilt, rcx, rcxp, rcy, rcyp, rcp, rcs, c_enom*c1m3, part_hit_pos, part_hit_turn, & + part_abs_pos, part_abs_turn, part_impact, part_indiv, part_linteract, & + onesided, nhit_stage, 1, nabs_type, linside) - if(cdb_isCrystal(icoll)) then - call cry_startElement(icoll,ie,myemitx0_dist,myemity0_dist,cry_tilt,c_length) - end if - call k2coll_collimate(icoll, iturn, ie, c_length, c_rotation, c_aperture, c_offset, & - c_tilt, rcx, rcxp, rcy, rcyp, rcp, rcs, enom_gev, part_hit_pos, part_hit_turn, & - part_abs_pos, part_abs_turn, part_impact, part_indiv, part_linteract, & - onesided, nhit_stage, 1, nabs_type, linside) - - if(cdb_isCrystal(icoll)) then - if(dowrite_crycoord) then + if(cdb_isCrystal(icoll)) then + if(dowrite_crycoord) then + do j=1,napx + isHit = part_hit_pos(j) == ie .and. part_hit_turn(j) == iturn + isAbs = part_abs_pos(j) == ie .and. part_abs_turn(j) == iturn + write(coll_cryEntUnit,"(i8,1x,i8,1x,a20,1x,a4,2(3x,l1),5(1x,1pe15.8))") & + partID(j),iturn,cdb_cName(icoll)(1:20),cdb_cMaterial(icoll),isHit,isAbs, & + rcx0(j),rcxp0(j),rcy0(j),rcyp0(j),rcp0(j) + write(coll_cryExitUnit,"(i8,1x,i8,1x,a20,1x,a4,2(3x,l1),5(1x,1pe15.8))") & + partID(j),iturn,cdb_cName(icoll)(1:20),cdb_cMaterial(icoll),isHit,isAbs, & + rcx(j),rcxp(j),rcy(j),rcyp(j),rcp(j) + end do + end if do j=1,napx - isHit = part_hit_pos(j) == ie .and. part_hit_turn(j) == iturn - isAbs = part_abs_pos(j) == ie .and. part_abs_turn(j) == iturn - write(coll_cryEntUnit,"(i8,1x,i8,1x,a20,1x,a4,2(3x,l1),5(1x,1pe15.8))") & - partID(j),iturn,cdb_cName(icoll)(1:20),cdb_cMaterial(icoll),isHit,isAbs, & - rcx0(j),rcxp0(j),rcy0(j),rcyp0(j),rcp0(j) - write(coll_cryExitUnit,"(i8,1x,i8,1x,a20,1x,a4,2(3x,l1),5(1x,1pe15.8))") & - partID(j),iturn,cdb_cName(icoll)(1:20),cdb_cMaterial(icoll),isHit,isAbs, & - rcx(j),rcxp(j),rcy(j),rcyp(j),rcp(j) + if(cry_proc(j) > 0) then + write(coll_cryInterUnit,"(i8,1x,i8,1x,a20,1x,i4,10(1x,1pe15.8))") & + partID(j), iturn, cdb_cName(icoll)(1:20),cry_proc(j),rcxp(j)-rcxp0(j), & + rcyp(j)-rcyp0(j),rcp0(j),rcp(j),rcxp0(j),rcyp0(j),cry_tilt,rcx0(j),rcy0(j) + end if end do end if +#else + call coll_doCollimator_Geant4(c_aperture,c_rotation,c_length) +#endif + + end if + + ! Calculate average impact parameter and save info for all collimators. + ! Copy information back and do negative drift. + + if(dowrite_impact) then + ! Update writeout of jaw profiles do j=1,napx - if(cry_proc(j) > 0) then - write(coll_cryInterUnit,"(i8,1x,i8,1x,a20,1x,i4,10(1x,1pe15.8))") & - partID(j), iturn, cdb_cName(icoll)(1:20),cry_proc(j),rcxp(j)-rcxp0(j), & - rcyp(j)-rcyp0(j),rcp0(j),rcp(j),rcxp0(j),rcyp0(j),cry_tilt,rcx0(j),rcy0(j) + if(linside(j) .and. sqrt(rcx(j)**2 + rcy(j)**2) < 99.0e-3_fPrec) then + x_Dump = rcx(j)*cRot + sRot*rcy(j) + xpDump = rcxp(j)*cRot + sRot*rcyp(j) + y_Dump = rcy(j)*cRot - sRot*rcx(j) + ypDump = rcyp(j)*cRot - sRot*rcxp(j) + s_Dump = c_length + write(coll_jawProfileUnit,"(3(1x,i7),5(1x,e17.9),1x,i1)") & + icoll,iturn,partID(j),x_Dump,xpDump,y_Dump,ypDump,s_Dump,2 end if end do end if -#else - - !! Add the geant4 geometry - if(firstrun .and. iturn == 1) then - call g4_add_collimator(cdb_cName(icoll), c_material, c_length, c_aperture, c_rotation, torbx(ie), torby(ie)) - end if - -!! Here we do the real collimation -!! First set the correct collimator - call g4_set_collimator(cdb_cName(icoll)) - flush(lout) - -!! Loop over all our particles - g4_lostc = 0 - nnuc0 = 0 - ien0 = zero - nnuc1 = 0 - ien1 = zero - - if(g4_debug .eqv. .true.) then - write(lout,"(2a)") 'COLLIMATOR:', cdb_cName(icoll) - write(lout,"(12a)") chr_lpad('id',33), chr_lpad('pdgid',12), chr_lpad('mass',25), chr_lpad('x',25), chr_lpad('y',25), & - chr_lpad('xp',25), chr_lpad('yp',25), chr_lpad('p',25), chr_lpad('spin_x',25), chr_lpad('spin_y',25),& - chr_lpad('spin_z',25) - flush(lout) - end if - - do j = 1, napx -!!!! if(part_abs_pos(j).eq.0 .and. part_abs_turn(j).eq.0) then -!! Rotate particles in the frame of the collimator -!! There is more precision if we do it here rather -!! than in the g4 geometry - - if(g4_debug .eqv. .true.) then - write(lout,"(a,2(1X,I11),10(1X,E24.16))") 'g4 sending particle: ', j, pdgid(j), nucm(j), rcx(j), rcy(j), rcxp(j), & - rcyp(j), rcp(j), spin_x(j), spin_y(j), spin_z(j), sigmv(j) - end if - - x_tmp = rcx(j) - y_tmp = rcy(j) - xp_tmp = rcxp(j) - yp_tmp = rcyp(j) - rcx(j) = x_tmp *cos_mb(c_rotation) + sin_mb(c_rotation)*y_tmp - rcy(j) = y_tmp *cos_mb(c_rotation) - sin_mb(c_rotation)*x_tmp - rcxp(j) = xp_tmp*cos_mb(c_rotation) + sin_mb(c_rotation)*yp_tmp - rcyp(j) = yp_tmp*cos_mb(c_rotation) - sin_mb(c_rotation)*xp_tmp - -!! Add all particles - call g4_add_particle(rcx(j), rcy(j), rcxp(j), rcyp(j), rcp(j), pdgid(j), nzz(j), naa(j), nqq(j), nucm(j), & - sigmv(j), spin_x(j), spin_y(j), spin_z(j)) - -! Log input energy + nucleons as per the FLUKA coupling - nnuc0 = nnuc0 + naa(j) - ien0 = ien0 + rcp(j) * c1e3 - end do - -!! Call the geant4 collimation function -! call g4_collimate(rcx(j), rcy(j), rcxp(j), rcyp(j), rcp(j)) - call g4_collimate() - -!! Get the particle number back - call g4_get_particle_count(g4_npart) - -!! resize arrays - call expand_arrays(nele, g4_npart, nblz, nblo, nbb) - -!! Reset napx to the correct value - napx = g4_npart - - if(g4_debug .eqv. .true.) then - write(lout,"(12a)") chr_lpad('id',33), chr_lpad('pdgid',12), chr_lpad('mass',25), chr_lpad('x',25), chr_lpad('y',25), & - chr_lpad('xp',25), chr_lpad('yp',25), chr_lpad('p',25), chr_lpad('spin_x',25), chr_lpad('spin_y',25),& - chr_lpad('spin_z',25) - flush(lout) - end if - - do j = 1, napx -!! Get the particle back + information -!! Remember C arrays start at 0, fortran at 1 here. - call g4_collimate_return(j-1, rcx(j), rcy(j), rcxp(j), rcyp(j), rcp(j), pdgid(j), nucm(j), nzz(j), naa(j), nqq(j), & - sigmv(j), part_hit_flag, part_abs_flag, part_impact(j), part_indiv(j), part_linteract(j), spin_x(j), spin_y(j), spin_z(j)) - - partID(j) = j - pstop (j) = .false. - -!! Rotate back into the accelerator frame - x_tmp = rcx(j) - y_tmp = rcy(j) - xp_tmp = rcxp(j) - yp_tmp = rcyp(j) - rcx(j) = x_tmp *cos_mb(-one*c_rotation) + sin_mb(-one*c_rotation)*y_tmp - rcy(j) = y_tmp *cos_mb(-one*c_rotation) - sin_mb(-one*c_rotation)*x_tmp - rcxp(j) = xp_tmp*cos_mb(-one*c_rotation) + sin_mb(-one*c_rotation)*yp_tmp - rcyp(j) = yp_tmp*cos_mb(-one*c_rotation) - sin_mb(-one*c_rotation)*xp_tmp - -! This needs fixing - FIXME -! sigmv(j) = zero -! sigmv(j) = s - (g4_v0*g4_time) - part_impact(j) = 0 - part_indiv(j) = 0 - part_linteract(j) = 0 - -! Log output energy + nucleons as per the FLUKA coupling - nnuc1 = nnuc1 + naa(j) ! outcoming nucleons - ien1 = ien1 + rcp(j) * c1e3 ! outcoming energy - -! Fix hits -! if(part_hit_pos(j) .eq.ie .and. part_hit_turn(j).eq.iturn) - part_hit_pos(j) = ie - part_hit_turn(j) = iturn - part_abs_pos(j) = 0 - part_abs_turn(j) = 0 - -!! If a particle hit -! if(part_hit_flag.ne.0) then -! part_hit_pos(j) = ie -! part_hit_turn(j) = iturn -! end if -! -!! If a particle died (the checking if it is already dead is at the start of the loop) -!! Geant just has a general inelastic process that single diffraction is part of -!! Therefore we can not know if this interaction was SD or some other inelastic type -! if(part_abs_flag.ne.0) then -! if(dowrite_impact) then -!!! FLUKA_impacts.dat -! write(coll_flukImpUnit,'(i4,(1x,f6.3),(1x,f8.6),4(1x,e19.10),i2,2(1x,i7))') & -! & icoll,c_rotation,zero,zero,zero,zero,zero,part_abs_flag,flukaname(j),iturn -! end if -! -! part_abs_pos(j) = ie -! part_abs_turn(j) = iturn -! rcx(j) = 99.99e-3_fPrec -! rcy(j) = 99.99e-3_fPrec -! g4_lostc = g4_lostc + 1 -! end if - - if(g4_debug .eqv. .true.) then - write(lout,"(a,2(1X,I11),10(1X,E24.16))") 'g4 return particle: ', j, pdgid(j), nucm(j), rcx(j), rcy(j), rcxp(j), & - rcyp(j), rcp(j), spin_x(j), spin_y(j), spin_z(j), sigmv(j) - end if - - flush(lout) -!!!! end if !part_abs_pos(j) .ne. 0 .and. part_abs_turn(j) .ne. 0 - end do !do j = 1, napx - - call g4_collimation_clear() - - if((ien0-ien1) > one) then -#ifdef ROOT - if(root_flag .and. root_Collimation == 1) then - call root_EnergyDeposition(icoll, nnuc0-nnuc1,c1m3*(ien0-ien1)) - end if -#endif - write(unit208,"(2(i5,1x),e24.16)") icoll, (nnuc0-nnuc1), c1m3*(ien0-ien1) - flush(unit208) - end if - -#endif - end if - - if(dowrite_impact) then - ! update writeout of jaw profiles - do j=1,napx - if(linside(j) .and. sqrt(rcx(j)**2 + rcy(j)**2) < 99.0e-3_fPrec) then - x_Dump = rcx (j)*cos_mb(c_rotation)+sin_mb(c_rotation)*rcy (j) - xpDump = rcxp(j)*cos_mb(c_rotation)+sin_mb(c_rotation)*rcyp(j) - y_Dump = rcy (j)*cos_mb(c_rotation)-sin_mb(c_rotation)*rcx (j) - ypDump = rcyp(j)*cos_mb(c_rotation)-sin_mb(c_rotation)*rcxp(j) - s_Dump = c_length - write(coll_jawProfileUnit,"(3(1x,i7),5(1x,e17.9),1x,i1)") & - icoll,iturn,partID(j),x_Dump,xpDump,y_Dump,ypDump,s_Dump,2 - end if - end do - end if - -end subroutine collimate_do_collimator - -!> -!! collimate_end_collimator() -!! This routine is called at the exit of a collimator -!< -subroutine collimate_end_collimator(stracki) - - use crcoall - use parpro - use coll_common - use mod_common - use mod_commons - use mod_common_da - use mod_common_main - use mod_common_track - use numerical_constants, only : c5m4 - use coll_db - use mod_units - use string_tools -#ifdef HDF5 - use hdf5_output - use hdf5_tracks2 -#endif -#ifdef G4COLLIMATION - use geant4 -#endif - - implicit none - - integer :: j - -#ifdef HDF5 - ! For tracks2 - integer hdfturn,hdfpid,hdftyp - real(kind=fPrec) hdfx,hdfxp,hdfy,hdfyp,hdfdee,hdfs -#endif - - real(kind=fPrec), intent(in) :: stracki - -!++ Output information: -!++ -!++ PART_HIT_POS (MAX_NPART) Hit flag for last hit -!++ PART_HIT_TURN(MAX_NPART) Hit flag for last hit -!++ PART_ABS_POS (MAX_NPART) Abs flag -!++ PART_ABS_TURN(MAX_NPART) Abs flag -!++ PART_IMPACT (MAX_NPART) Impact parameter (0 for inner face) -!++ PART_INDIV (MAX_NPART) Divergence of impacting particles -!------------------------------------------------------------------------------ -!++ Calculate average impact parameter and save info for all -!++ collimators. Copy information back and do negative drift. - n_impact = 0 - n_absorbed = 0 - sum = zero - sqsum = zero - #ifdef G4COLLIMATION - do j = 1, napx - if (stracki.eq.0.) then - if(iexact .eqv. .false.) then -! write(lout,*) 'iexact = 0', rcxp(j), rcyp(j) - rcx(j) = rcx(j) - half*c_length*rcxp(j) - rcy(j) = rcy(j) - half*c_length*rcyp(j) - else -! write(lout,*) 'iexact = 1', rcxp(j), rcyp(j) - zpj=sqrt(one-rcxp(j)**2-rcyp(j)**2) - rcx(j) = rcx(j) - half*c_length*(rcxp(j)/zpj) - rcy(j) = rcy(j) - half*c_length*(rcyp(j)/zpj) - end if + do j=1,napx + if(stracki == zero) then + if(iexact .eqv. .false.) then + rcx(j) = rcx(j) - (half*c_length)*rcxp(j) + rcy(j) = rcy(j) - (half*c_length)*rcyp(j) + else + zpj = sqrt(one-rcxp(j)**2-rcyp(j)**2) + rcx(j) = rcx(j) - (half*c_length)*(rcxp(j)/zpj) + rcy(j) = rcy(j) - (half*c_length)*(rcyp(j)/zpj) end if + end if -!++ Now copy data back to original verctor - xv1(j) = rcx(j) * c1e3 + torbx(ie) - yv1(j) = rcxp(j) * c1e3 + torbxp(ie) - xv2(j) = rcy(j) * c1e3 + torby(ie) - yv2(j) = rcyp(j) * c1e3 + torbyp(ie) - ejv(j) = rcp(j) * c1e3 - - -! Update mtc and other arrays. -! ejv(j) = rcp(j) * c1e3 -!!! write(lout,*) 'ejfv', ejv(j), nucm(j) -! ejfv (j) = sqrt((ejv(j)-nucm(j))*(ejv(j)+nucm(j))) ! hisix: ion mass - ejfv(j)=sqrt(ejv(j)**2-nucm(j)**2) -!!! write(lout,*) 'ejfv ok', ejfv(j) - rvv (j) = (ejv(j)*e0f)/(e0*ejfv(j)) ! hisix: remains unchanged - dpsv (j) = (ejfv(j)*(nucm0/nucm(j))-e0f)/e0f ! hisix: new delta - oidpsv(j) = one/(one+dpsv(j)) - dpsv1 (j) = (dpsv(j)*c1e3)*oidpsv(j) - mtc (j) = (nqq(j)*nucm0)/(qq0*nucm(j)) ! hisix: mass to charge - moidpsv (j) = mtc(j)*oidpsv(j) ! hisix - omoidpsv(j) = c1e3*((one-mtc(j))*oidpsv(j)) ! hisix - -!++ Energy update, as recommended by Frank -! ejfv(j)=sqrt(ejv(j)**2-nucm(j)**2) -! rvv(j)=(ejv(j)*e0f)/(e0*ejfv(j)) -! dpsv(j)=(ejfv(j)*(nucm0/nucm(j))-e0f)/e0f -! oidpsv(j)=one/(one+dpsv(j)) -! moidpsv(j)=mtc(j)/(one+dpsv(j)) -! omoidpsv(j)=c1e3*((one-mtc(j))*oidpsv(j)) -! dpsv1(j)=(dpsv(j)*c1e3)*oidpsv(j) - yv1(j) = ejf0v(j)/ejfv(j)*yv1(j) - yv2(j) = ejf0v(j)/ejfv(j)*yv2(j) -!!! write(lout,*) 'Coordinate loop end' -end do -#endif - -#ifndef G4COLLIMATION -!++ Copy particle data back and do path length stuff; check for absorption -!++ Add orbit offset back. - do j = 1, napx - -!APRIL2005 IN ORDER TO GET RID OF NUMERICAL ERRORS, JUST DO THE TREATMENT FOR -!APRIL2005 IMPACTING PARTICLES... - if(part_hit_pos(j) .eq.ie .and. part_hit_turn(j).eq.iturn) then -!++ For zero length element track back half collimator length -! DRIFT PART - if (stracki.eq.0.) then + ! Now copy data back to original verctor + xv1(j) = rcx(j)*c1e3 + torbx(ie) + yv1(j) = rcxp(j)*c1e3 + torbxp(ie) + xv2(j) = rcy(j)*c1e3 + torby(ie) + yv2(j) = rcyp(j)*c1e3 + torbyp(ie) + ejv(j) = rcp(j)*c1e3 + + ! Update mtc and other arrays. + ejfv (j) = sqrt(ejv(j)**2-nucm(j)**2) + rvv (j) = (ejv(j)*e0f)/(e0*ejfv(j)) + dpsv (j) = (ejfv(j)*(nucm0/nucm(j))-e0f)/e0f + oidpsv (j) = one/(one+dpsv(j)) + dpsv1 (j) = (dpsv(j)*c1e3)*oidpsv(j) + mtc (j) = (nqq(j)*nucm0)/(qq0*nucm(j)) + moidpsv (j) = mtc(j)*oidpsv(j) + omoidpsv(j) = c1e3*((one-mtc(j))*oidpsv(j)) + yv1 (j) = ejf0v(j)/ejfv(j)*yv1(j) + yv2 (j) = ejf0v(j)/ejfv(j)*yv2(j) + end do +#else + ! Copy particle data back and do path length stuff; check for absorption + ! Add orbit offset back. + do j=1,napx + ! In order to get rid of numerical errors, just do the treatment for impacting particles + if(part_hit_pos(j) == ie .and. part_hit_turn(j) == iturn) then + ! For zero length element track back half collimator length + if(stracki == zero) then if(iexact) then - zpj=sqrt(one-rcxp(j)**2-rcyp(j)**2) - rcx(j) = rcx(j) - half*c_length*(rcxp(j)/zpj) - rcy(j) = rcy(j) - half*c_length*(rcyp(j)/zpj) + zpj = sqrt(one-rcxp(j)**2-rcyp(j)**2) + rcx(j) = rcx(j) - (half*c_length)*(rcxp(j)/zpj) + rcy(j) = rcy(j) - (half*c_length)*(rcyp(j)/zpj) else - rcx(j) = rcx(j) - half*c_length*rcxp(j) - rcy(j) = rcy(j) - half*c_length*rcyp(j) + rcx(j) = rcx(j) - (half*c_length)*rcxp(j) + rcy(j) = rcy(j) - (half*c_length)*rcyp(j) end if end if -!++ Now copy data back to original verctor - xv1(j) = rcx(j) * c1e3 + torbx(ie) - yv1(j) = rcxp(j) * c1e3 + torbxp(ie) - xv2(j) = rcy(j) * c1e3 + torby(ie) - yv2(j) = rcyp(j) * c1e3 + torbyp(ie) - ejv(j) = rcp(j) * c1e3 - -!++ Energy update, as recommended by Frank - ejfv(j)=sqrt(ejv(j)**2-nucm(j)**2) - rvv(j)=(ejv(j)*e0f)/(e0*ejfv(j)) - dpsv(j)=(ejfv(j)*(nucm0/nucm(j))-e0f)/e0f - oidpsv(j)=one/(one+dpsv(j)) - mtc(j) = (nqq(j)*nucm0)/(qq0*nucm(j)) ! hisix: mass to charge - moidpsv(j)=mtc(j)/(one+dpsv(j)) - omoidpsv(j)=c1e3*((one-mtc(j))*oidpsv(j)) - dpsv1(j)=(dpsv(j)*c1e3)*oidpsv(j) - yv1(j) = ejf0v(j)/ejfv(j)*yv1(j) - yv2(j) = ejf0v(j)/ejfv(j)*yv2(j) - -!++ For absorbed particles set all coordinates to zero. Also -!++ include very large offsets, let's say above 100mm or -!++ 100mrad. + ! Now copy data back to original verctor + xv1(j) = rcx(j)*c1e3 + torbx(ie) + yv1(j) = rcxp(j)*c1e3 + torbxp(ie) + xv2(j) = rcy(j)*c1e3 + torby(ie) + yv2(j) = rcyp(j)*c1e3 + torbyp(ie) + ejv(j) = rcp(j)*c1e3 + + ! Energy update, as recommended by Frank + ejfv(j) = sqrt(ejv(j)**2-nucm(j)**2) + rvv(j) = (ejv(j)*e0f)/(e0*ejfv(j)) + dpsv(j) = (ejfv(j)*(nucm0/nucm(j))-e0f)/e0f + oidpsv(j) = one/(one+dpsv(j)) + mtc(j) = (nqq(j)*nucm0)/(qq0*nucm(j)) + moidpsv(j) = mtc(j)/(one+dpsv(j)) + omoidpsv(j) = c1e3*((one-mtc(j))*oidpsv(j)) + dpsv1(j) = (dpsv(j)*c1e3)*oidpsv(j) + yv1(j) = (ejf0v(j)/ejfv(j))*yv1(j) + yv2(j) = (ejf0v(j)/ejfv(j))*yv2(j) + + ! For absorbed particles set all coordinates to zero. Also include very + ! large offsets, let's say above 100mm or 100mrad. if((part_abs_pos(j) /= 0 .and. part_abs_turn(j) /= 0) .or. & xv1(j) > c1e2 .or. yv1(j) > c1e2 .or. xv2(j) > c1e2 .or. yv2(j) > c1e2) then xv1(j) = zero yv1(j) = zero xv2(j) = zero yv2(j) = zero - ejv(j) = myenom + ejv(j) = c_enom sigmv(j) = zero part_abs_pos(j) = ie part_abs_turn(j) = iturn nabs_type(j) = 0 nhit_stage(j) = 0 end if - -!APRIL2005 ...OTHERWISE JUST GET BACK FORMER COORDINATES else - xv1(j) = rcx0(j) * c1e3 + torbx(ie) - yv1(j) = rcxp0(j) * c1e3 + torbxp(ie) - xv2(j) = rcy0(j) * c1e3 + torby(ie) - yv2(j) = rcyp0(j) * c1e3 + torbyp(ie) - ejv(j) = rcp0(j) * c1e3 + ! Otherwise just get back former coordinates + xv1(j) = rcx0(j)*c1e3 + torbx(ie) + yv1(j) = rcxp0(j)*c1e3 + torbxp(ie) + xv2(j) = rcy0(j)*c1e3 + torby(ie) + yv2(j) = rcyp0(j)*c1e3 + torbyp(ie) + ejv(j) = rcp0(j)*c1e3 end if + end do -!++ First check for particle interaction at this collimator and this turn - if(part_hit_pos (j).eq.ie .and. part_hit_turn(j).eq.iturn) then - -!++ Fill the change in particle angle into histogram - if(dowrite_impact) then -#ifdef HDF5 - if(h5_useForCOLL) then - call h5_prepareWrite(coll_hdf5_allImpacts, 1) - call h5_writeData(coll_hdf5_allImpacts, 1, 1, partID(j)) - call h5_writeData(coll_hdf5_allImpacts, 2, 1, iturn) - call h5_writeData(coll_hdf5_allImpacts, 3, 1, dcum(ie)) - call h5_finaliseWrite(coll_hdf5_allImpacts) - else -#endif - write(coll_allImpactUnit,"(i8,1x,i4,1x,f8.2)") partID(j),iturn,dcum(ie) -#ifdef HDF5 - end if -#endif - end if + if(dowrite_impact) then + call coll_writeImpactAbsorb + end if - ! Particle has impacted - if(part_abs_pos(j) .ne.0 .and. part_abs_turn(j).ne.0) then - if(dowrite_impact) then -#ifdef HDF5 - if(h5_useForCOLL) then - call h5_prepareWrite(coll_hdf5_allAbsorb, 1) - call h5_writeData(coll_hdf5_allAbsorb, 1, 1, partID(j)) - call h5_writeData(coll_hdf5_allAbsorb, 2, 1, iturn) - call h5_writeData(coll_hdf5_allAbsorb, 3, 1, dcum(ie)) - call h5_finaliseWrite(coll_hdf5_allAbsorb) - else -#endif - write(coll_allAbsorbUnit,"(i8,1x,i8,1x,f10.3)") partID(j),iturn,dcum(ie) -#ifdef HDF5 - end if -#endif - end if + n_absorbed = 0 + do j=1,napx + if(part_hit_pos(j) == ie .and. part_hit_turn(j) == iturn) then - !Here we've found a newly hit particle - else if(part_abs_pos (j).eq.0 .and. part_abs_turn(j).eq.0) then - xkick = rcxp(j) - rcxp0(j) - ykick = rcyp(j) - rcyp0(j) + ! Calculate impact observables, fill histograms, save collimator info + cn_impact(icoll) = cn_impact(icoll) + 1 + csum(icoll) = csum(icoll) + part_impact(j) + csqsum(icoll) = csqsum(icoll) + part_impact(j)**2 + + if(part_abs_pos(j) /= 0 .and. part_abs_turn(j) /= 0) then + ! If the interacting particle was lost, add-up counters for absorption + ! Note: a particle with x/y >= 99. never hits anything any more in the logic of this program. + ! Be careful to always fulfill this! + n_absorbed = n_absorbed + 1 + cn_absorbed(icoll) = cn_absorbed(icoll) + 1 + n_tot_absorbed = n_tot_absorbed + 1 - ! Record the hit type - nhit_stage(j) = ior(nhit_stage(j),cdb_cStage(icoll)) + elseif(part_abs_pos (j) == 0 .and. part_abs_turn(j) == 0) then + nhit_stage(j) = ior(nhit_stage(j),cdb_cStage(icoll)) ! Record the hit type else write(lerr,"(a)") "COLL> ERROR Particle cannot be both absorbed and not absorbed" write(lerr,"(a,2(1x,i0))") "COLL> ",part_abs_pos (j),part_abs_turn(j) call prror end if -!GRD THIS LOOP MUST NOT BE WRITTEN INTO THE "IF(FIRSTRUN)" LOOP !!!!! - if(dowritetracks) then - if(part_abs_pos(j).eq.0 .and. part_abs_turn(j).eq.0) then - if(nhit_stage(j) > 0 .and. & - (xv1(j).lt.99.0_fPrec .and. xv2(j).lt.99.0_fPrec).and.& -!GRD HERE WE APPLY THE SAME KIND OF CUT THAN THE SIGSECUT PARAMETER - ((((xv1(j)*c1m3)**2 / (tbetax(ie)*myemitx0_collgap)) .ge. sigsecut2) .or. & - (((xv2(j)*c1m3)**2 / (tbetay(ie)*myemity0_collgap)) .ge. sigsecut2) .or. & - (((xv1(j)*c1m3)**2 / (tbetax(ie)*myemitx0_collgap)) + & - ((xv2(j)*c1m3)**2 / (tbetay(ie)*myemity0_collgap)) .ge. sigsecut3)) ) then - - xj = (xv1(j)-torbx(ie)) /c1e3 - xpj = (yv1(j)-torbxp(ie)) /c1e3 - yj = (xv2(j)-torby(ie)) /c1e3 - ypj = (yv2(j)-torbyp(ie)) /c1e3 - -#ifdef HDF5 - if(h5_writeTracks2) then - ! We write trajectories before and after element in this case. - hdfpid = partID(j) - hdfturn = iturn - hdfs = dcum(ie)-half*c_length - hdfx = (rcx0(j)*c1e3+torbx(ie)) - half*c_length*(rcxp0(j)*c1e3+torbxp(ie)) - hdfxp = rcxp0(j)*c1e3+torbxp(ie) - hdfy = (rcy0(j)*c1e3+torby(ie)) - half*c_length*(rcyp0(j)*c1e3+torbyp(ie)) - hdfyp = rcyp0(j)*c1e3+torbyp(ie) - hdfdee = (ejv(j)-myenom)/myenom - hdftyp = nhit_stage(j) - call h5tr2_writeLine(hdfpid,hdfturn,hdfs,hdfx,hdfxp,hdfy,hdfyp,hdfdee,hdftyp) - - hdfs = dcum(ie)+half*c_length - hdfx = xv1(j) + half*c_length*yv1(j) - hdfxp = yv1(j) - hdfy = xv2(j) + half*c_length*yv2(j) - hdfyp = yv2(j) - call h5tr2_writeLine(hdfpid,hdfturn,hdfs,hdfx,hdfxp,hdfy,hdfyp,hdfdee,hdftyp) - else -#endif - write(coll_tracksUnit,"(1x,i8,1x,i4,1x,f10.2,4(1x,e12.5),1x,e11.3,1x,i4)") & - partID(j),iturn,dcum(ie)-half*c_length, & - (rcx0(j)*c1e3+torbx(ie))-half*c_length*(rcxp0(j)*c1e3+torbxp(ie)), & - rcxp0(j)*c1e3+torbxp(ie), & - (rcy0(j)*c1e3+torby(ie))-half*c_length*(rcyp0(j)*c1e3+torbyp(ie)), & - rcyp0(j)*c1e3+torbyp(ie), & - (ejv(j)-myenom)/myenom,nhit_stage(j) - - write(coll_tracksUnit,"(1x,i8,1x,i4,1x,f10.2,4(1x,e12.5),1x,e11.3,1x,i4)") & - partID(j),iturn,dcum(ie)+half*c_length, & - xv1(j)+half*c_length*yv1(j),yv1(j), & - xv2(j)+half*c_length*yv2(j),yv2(j),(ejv(j)-myenom)/myenom, & - nhit_stage(j) -#ifdef HDF5 - end if -#endif - end if - end if !if(part_abs_pos(j).eq.0 .and. part_abs_turn(j).eq.0) then - end if !if(dowritetracks) then - -!++ Calculate impact observables, fill histograms, save collimator info, ... - n_impact = n_impact + 1 - sum = sum + part_impact(j) - sqsum = sqsum + part_impact(j)**2 - cn_impact(icoll) = cn_impact(icoll) + 1 - csum(icoll) = csum(icoll) + part_impact(j) - csqsum(icoll) = csqsum(icoll) + part_impact(j)**2 - -!++ If the interacting particle was lost, add-up counters for absorption -!++ Note: a particle with x/y >= 99. never hits anything any more in -!++ the logic of this program. Be careful to always fulfill this! - if(part_abs_pos(j).ne.0 .and. part_abs_turn(j).ne.0) then - n_absorbed = n_absorbed + 1 - cn_absorbed(icoll) = cn_absorbed(icoll) + 1 - n_tot_absorbed = n_tot_absorbed + 1 - iturn_last_hit = part_hit_before_turn(j) - iturn_absorbed = part_hit_turn(j) - if(iturn_last_hit.eq.0) then - iturn_last_hit = iturn_absorbed - iturn_survive = iturn_absorbed - iturn_last_hit - end if - end if - -!++ End of check for hit this turn and element end if - end do ! end do j = 1, napx - -!++ Calculate statistical observables and save into files... - if (n_impact.gt.0) then - average = sum/n_impact + end do - if (sqsum/n_impact.ge.average**2) then - sigma = sqrt(sqsum/n_impact - average**2) - else - sigma = zero - end if - else - average = zero - sigma = zero + if(dowrite_tracks) then + call coll_writeTracks2(1) end if - if(cn_impact(icoll).gt.0) then + if(cn_impact(icoll) > 0) then caverage(icoll) = csum(icoll)/cn_impact(icoll) - if((caverage(icoll)**2).gt.(csqsum(icoll)/cn_impact(icoll))) then + if(caverage(icoll)**2 > csqsum(icoll)/cn_impact(icoll)) then csigma(icoll) = 0 else csigma(icoll) = sqrt(csqsum(icoll)/cn_impact(icoll) - caverage(icoll)**2) end if end if -!----------------------------------------------------------------- -!++ For a S E L E C T E D collimator only consider particles that -!++ were scattered on this selected collimator at the first turn. All -!++ other particles are discarded. -!++ - This is switched on with the DO_SELECT flag in the input file. -!++ - Note that the part_select(j) flag defaults to 1 for all particles. - ! Checking lower case of collimator name against name_sel (which is already lower case) ! This is to ensure compatibility with old style COLL block which used upper case collimator name if(chr_toLower(cdb_cName(icoll)) == name_sel .and. iturn == 1) then - num_selhit = 0 - num_surhit = 0 - num_selabs = 0 - - do j=1,napx - if(part_hit_pos (j) == ie .and. part_hit_turn(j) == iturn) then - num_selhit = num_selhit+1 - if(part_abs_pos(j) == 0 .and. part_abs_turn(j) == 0) then - num_surhit = num_surhit+1 - else - num_selabs = num_selabs + 1 - end if -!++ If we want to select only partciles interacting at the specified -!++ collimator then remove all other particles and reset the number -!++ of the absorbed particles to the selected collimator. - else if(do_select .and. firstrun) then - part_select(j) = 0 - n_tot_absorbed = num_selabs - end if - end do - -!++ Calculate average impact parameter and save distribution into file -!++ only for selected collimator - n_impact = 0 - sum = zero - sqsum = zero - - do j=1,napx - if(part_hit_pos(j) == ie .and. part_hit_turn(j) == iturn) then - if(part_impact(j) < -half) then - write(lerr,"(a,i0)") "COLL> ERROR Found invalid impact parameter ", part_impact(j) - write(outlun,*) 'ERR> Invalid impact parameter!', part_impact(j) - call prror - end if - - n_impact = n_impact + 1 - sum = sum + part_impact(j) - sqsum = sqsum + part_impact(j)**2 - if(part_hit_pos (j).ne.0 .and. part_hit_turn(j).ne.0 .and.dowrite_impact ) then - write(coll_impactUnit,*) part_impact(j), part_indiv(j) - end if - end if - end do - - if(n_impact.gt.0) then - average = sum/n_impact - if(sqsum/n_impact.ge.average**2) then - sigma = sqrt(sqsum/n_impact - average**2) - else - sigma = zero - end if - end if - -!++ Some information - write(lout,"(a,i8)") 'COLL> Selected collimator had N hits. N: ', num_selhit - write(lout,"(a,i8)") 'COLL> Number of impacts : ', n_impact - write(lout,"(a,i8)") 'COLL> Number of escaped protons : ', num_surhit - write(lout,"(a,e15.8)") 'COLL> Average impact parameter [m] : ', average - write(lout,"(a,e15.8)") 'COLL> Sigma impact parameter [m] : ', sigma - - if(dowrite_impact) then - call f_close(coll_impactUnit) - end if - -!++ End of S E L E C T E D collimator + call coll_writeSelectedCollimator end if #endif + call time_stopClock(time_clockCOLL) -end subroutine collimate_end_collimator +end subroutine coll_doCollimator ! ================================================================================================ ! ! Collimate Exit ! ================================================================================================ ! -subroutine collimate_exit +subroutine coll_exitCollimation - use parpro - use coll_common - use mod_common - use mod_commons - use mod_common_da - use mod_common_main - use mod_common_track use crcoall - use coll_db use mod_units + use mod_common + use mod_common_track use string_tools -#ifdef ROOT - use root_output -#endif + use coll_common + use coll_db #ifdef HDF5 use hdf5_output use hdf5_tracks2 @@ -3051,178 +1969,172 @@ subroutine collimate_exit #endif integer i,k,ix - call f_close(coll_survivalUnit) - if(dowrite_impact) then - call f_close(coll_impactUnit) - end if - if(dowritetracks) then - call f_close(coll_tracksUnit) -#ifdef HDF5 - if(h5_writeTracks2) call h5tr2_finalise -#endif - end if - if(coll_hasCrystal .and. dowrite_crycoord) then - call f_close(coll_cryEntUnit) - call f_close(coll_cryExitUnit) - end if - -!------------------------------------------------------------------------ -!++ Write the number of absorbed particles - write(outlun,*) 'INFO> Number of impacts : ', n_tot_absorbed+nsurvive_end - write(outlun,*) 'INFO> Number of impacts at selected : ', num_selhit - write(outlun,*) 'INFO> Number of surviving particles : ', nsurvive_end - write(outlun,*) 'INFO> Number of absorbed particles : ', n_tot_absorbed + ! Write the number of absorbed particles + write(outlun,*) "INFO> Number of impacts : ", n_tot_absorbed+nsurvive_end + write(outlun,*) "INFO> Number of impacts at selected : ", num_selhit + write(outlun,*) "INFO> Number of surviving particles : ", nsurvive_end + write(outlun,*) "INFO> Number of absorbed particles : ", n_tot_absorbed write(outlun,*) - if(n_tot_absorbed.ne.0) then - write(outlun,*) ' INFO> Eff_r @ 8 sigma [e-4] : ', (neff(5)/real(n_tot_absorbed,fPrec))/c1m4 - write(outlun,*) ' INFO> Eff_r @ 10 sigma [e-4] : ', (neff(9)/real(n_tot_absorbed,fPrec))/c1m4 - write(outlun,*) ' INFO> Eff_r @ 10-20 sigma [e-4] : ', ((neff(9)-neff(19))/(real(n_tot_absorbed,fPrec)))/c1m4 - write(outlun,*) - write(outlun,*) neff(5)/real(n_tot_absorbed,fPrec), neff(9)/real(n_tot_absorbed,fPrec), & - (neff(9)-neff(19))/(real(n_tot_absorbed,fPrec)), ' !eff' - write(outlun,*) + if(n_tot_absorbed /= 0) then + if(dowrite_efficiency) then + write(outlun,*) " INFO> Eff_r @ 8 sigma [e-4] : ", (neff(5)/real(n_tot_absorbed,fPrec))/c1m4 + write(outlun,*) " INFO> Eff_r @ 10 sigma [e-4] : ", (neff(9)/real(n_tot_absorbed,fPrec))/c1m4 + write(outlun,*) " INFO> Eff_r @ 10-20 sigma [e-4] : ", ((neff(9)-neff(19))/(real(n_tot_absorbed,fPrec)))/c1m4 + write(outlun,*) + write(outlun,*) neff(5)/real(n_tot_absorbed,fPrec), neff(9)/real(n_tot_absorbed,fPrec), & + (neff(9)-neff(19))/(real(n_tot_absorbed,fPrec)), " !eff" + write(outlun,*) + else + write(outlun,*) "INFO> Efficiency calculations not enabled" + end if else write(lout,"(a)") "COLL> No particles absorbed" - endif + end if write(lout,"(a)") - write(lout,"(a,i8)") 'COLL> Number of impacts : ', n_tot_absorbed+nsurvive_end - write(lout,"(a,i8)") 'COLL> Number of impacts at selected : ', num_selhit - write(lout,"(a,i8)") 'COLL> Number of surviving particles : ', nsurvive_end - write(lout,"(a,i8)") 'COLL> Number of absorbed particles : ', n_tot_absorbed + write(lout,"(a,i8)") "COLL> Number of impacts : ", n_tot_absorbed+nsurvive_end + write(lout,"(a,i8)") "COLL> Number of impacts at selected : ", num_selhit + write(lout,"(a,i8)") "COLL> Number of surviving particles : ", nsurvive_end + write(lout,"(a,i8)") "COLL> Number of absorbed particles : ", n_tot_absorbed write(lout,"(a)") - if(n_tot_absorbed.ne.0) then - write(lout,"(a,f20.12)") 'COLL> Eff_r @ 8 sigma [e-4] : ', (neff(5)/real(n_tot_absorbed,fPrec))/c1m4 - write(lout,"(a,f20.12)") 'COLL> Eff_r @ 10 sigma [e-4] : ', (neff(9)/real(n_tot_absorbed,fPrec))/c1m4 - write(lout,"(a,f20.12)") 'COLL> Eff_r @ 10-20 sigma [e-4] : ', ((neff(9)-neff(19))/real(n_tot_absorbed,fPrec))/c1m4 + if(n_tot_absorbed /= 0) then + if(dowrite_efficiency) then + write(lout,"(a,f20.12)") "COLL> Eff_r @ 8 sigma [e-4] : ", (neff(5)/real(n_tot_absorbed,fPrec))/c1m4 + write(lout,"(a,f20.12)") "COLL> Eff_r @ 10 sigma [e-4] : ", (neff(9)/real(n_tot_absorbed,fPrec))/c1m4 + write(lout,"(a,f20.12)") "COLL> Eff_r @ 10-20 sigma [e-4] : ", ((neff(9)-neff(19))/real(n_tot_absorbed,fPrec))/c1m4 + else + write(lout,"(a)") "COLL> Efficiency calculations not enabled" + end if else - write(lout,"(a)") 'COLL> No particle absorbed' + write(lout,"(a)") "COLL> No particle absorbed" end if write(lout,"(a)") - ! Write efficiency file + if(dowrite_efficiency) then + ! Write efficiency file #ifdef HDF5 - if(h5_useForCOLL .and. n_tot_absorbed /= 0) then - allocate(fldHdf(8)) - fldHdf(1) = h5_dataField(name="RAD_SIGMA", type=h5_typeReal) - fldHdf(2) = h5_dataField(name="NEFFX/NTOT", type=h5_typeReal) - fldHdf(3) = h5_dataField(name="NEFFY/NTOT", type=h5_typeReal) - fldHdf(4) = h5_dataField(name="NEFF/NTOT", type=h5_typeReal) - fldHdf(5) = h5_dataField(name="NEFFX", type=h5_typeReal) - fldHdf(6) = h5_dataField(name="NEFFY", type=h5_typeReal) - fldHdf(7) = h5_dataField(name="NEFF", type=h5_typeReal) - fldHdf(8) = h5_dataField(name="NTOT", type=h5_typeInt) - call h5_createFormat("collEfficiency", fldHdf, fmtHdf) - call h5_createDataSet("efficiency", h5_collID, fmtHdf, setHdf, numeff) - call h5_prepareWrite(setHdf, numeff) - call h5_writeData(setHdf, 1, numeff, rsig(1:numeff)) - call h5_writeData(setHdf, 2, numeff, neffx(1:numeff)/real(n_tot_absorbed,real64)) - call h5_writeData(setHdf, 3, numeff, neffy(1:numeff)/real(n_tot_absorbed,real64)) - call h5_writeData(setHdf, 4, numeff, neff(1:numeff)/real(n_tot_absorbed,real64)) - call h5_writeData(setHdf, 5, numeff, neffx(1:numeff)) - call h5_writeData(setHdf, 6, numeff, neffy(1:numeff)) - call h5_writeData(setHdf, 7, numeff, neff(1:numeff)) - call h5_writeData(setHdf, 8, numeff, n_tot_absorbed) - call h5_finaliseWrite(setHdf) - deallocate(fldHdf) - else -#endif - call f_requestUnit(coll_efficFile,coll_efficUnit) - call f_open(unit=coll_efficUnit,file=coll_efficFile,formatted=.true.,mode="w",status="replace") - if(n_tot_absorbed /= 0) then - write(coll_efficUnit,"(a1,1x,a13,6(1x,a15),1x,a8)") "#","rad_sigma",& - "frac_x","frac_y","frac_r","eff_x","eff_y","eff_r","n_abs" - do k=1,numeff - write(coll_efficUnit,"(7(1x,e15.7),1x,i8)") rsig(k), neffx(k)/real(n_tot_absorbed,fPrec), & - neffy(k)/real(n_tot_absorbed,fPrec), neff(k)/real(n_tot_absorbed,fPrec), neffx(k), neffy(k), neff(k), n_tot_absorbed - end do + if(h5_useForCOLL .and. n_tot_absorbed /= 0) then + allocate(fldHdf(8)) + fldHdf(1) = h5_dataField(name="RAD_SIGMA", type=h5_typeReal) + fldHdf(2) = h5_dataField(name="NEFFX/NTOT", type=h5_typeReal) + fldHdf(3) = h5_dataField(name="NEFFY/NTOT", type=h5_typeReal) + fldHdf(4) = h5_dataField(name="NEFF/NTOT", type=h5_typeReal) + fldHdf(5) = h5_dataField(name="NEFFX", type=h5_typeReal) + fldHdf(6) = h5_dataField(name="NEFFY", type=h5_typeReal) + fldHdf(7) = h5_dataField(name="NEFF", type=h5_typeReal) + fldHdf(8) = h5_dataField(name="NTOT", type=h5_typeInt) + call h5_createFormat("collEfficiency", fldHdf, fmtHdf) + call h5_createDataSet("efficiency", h5_collID, fmtHdf, setHdf, numeff) + call h5_prepareWrite(setHdf, numeff) + call h5_writeData(setHdf, 1, numeff, rsig(1:numeff)) + call h5_writeData(setHdf, 2, numeff, neffx(1:numeff)/real(n_tot_absorbed,real64)) + call h5_writeData(setHdf, 3, numeff, neffy(1:numeff)/real(n_tot_absorbed,real64)) + call h5_writeData(setHdf, 4, numeff, neff(1:numeff)/real(n_tot_absorbed,real64)) + call h5_writeData(setHdf, 5, numeff, neffx(1:numeff)) + call h5_writeData(setHdf, 6, numeff, neffy(1:numeff)) + call h5_writeData(setHdf, 7, numeff, neff(1:numeff)) + call h5_writeData(setHdf, 8, numeff, n_tot_absorbed) + call h5_finaliseWrite(setHdf) + deallocate(fldHdf) else - write(coll_efficUnit,"(a)") "No particles absorbed" - end if - call f_close(coll_efficUnit) -#ifdef HDF5 - end if #endif - - ! Write efficiency vs dp/p file + call f_requestUnit(coll_efficFile,coll_efficUnit) + call f_open(unit=coll_efficUnit,file=coll_efficFile,formatted=.true.,mode="w",status="replace") + if(n_tot_absorbed /= 0) then + write(coll_efficUnit,"(a1,1x,a13,6(1x,a15),1x,a8)") "#","rad_sigma",& + "frac_x","frac_y","frac_r","eff_x","eff_y","eff_r","n_abs" + do k=1,numeff + write(coll_efficUnit,"(7(e15.7,1x),i8)") rsig(k), neffx(k)/real(n_tot_absorbed,fPrec), & + neffy(k)/real(n_tot_absorbed,fPrec), neff(k)/real(n_tot_absorbed,fPrec), neffx(k), neffy(k), neff(k), n_tot_absorbed + end do + else + write(coll_efficUnit,"(a)") "No particles absorbed" + end if + call f_close(coll_efficUnit) #ifdef HDF5 - if(h5_useForCOLL .and. n_tot_absorbed /= 0) then - allocate(fldHdf(5)) - fldHdf(1) = h5_dataField(name="DP/P", type=h5_typeReal) - fldHdf(2) = h5_dataField(name="NDPOP/TNABS", type=h5_typeReal) - fldHdf(3) = h5_dataField(name="NDPOP", type=h5_typeReal) - fldHdf(4) = h5_dataField(name="TNABS", type=h5_typeInt) - fldHdf(5) = h5_dataField(name="NPART", type=h5_typeInt) - call h5_createFormat("collEfficiencyDPOP", fldHdf, fmtHdf) - call h5_createDataSet("efficiency_dpop", h5_collID, fmtHdf, setHdf, numeffdpop) - call h5_prepareWrite(setHdf, numeffdpop) - call h5_writeData(setHdf, 1, numeffdpop, dpopbins(1:numeffdpop)) - call h5_writeData(setHdf, 2, numeffdpop, neffdpop(1:numeffdpop)/real(n_tot_absorbed,real64)) - call h5_writeData(setHdf, 3, numeffdpop, neffdpop(1:numeffdpop)) - call h5_writeData(setHdf, 4, numeffdpop, n_tot_absorbed) - call h5_writeData(setHdf, 5, numeffdpop, npartdpop(1:numeffdpop)) - call h5_finaliseWrite(setHdf) - deallocate(fldHdf) - else -#endif - call f_requestUnit(coll_efficDPFile,coll_efficDPUnit) - call f_open(unit=coll_efficDPUnit,file=coll_efficDPFile,formatted=.true.,mode="w",status="replace") - if(n_tot_absorbed /= 0) then - write(coll_efficDPUnit,"(a1,1x,a13,2(1x,a15),2(1x,a8))") "#","dp/p","n_dpop/tot_nabs","n_dpop","tot_nabs","npart" - do k=1,numeffdpop - write(coll_efficDPUnit,"(e15.7,2(1x,e15.7),2(1x,i8))") dpopbins(k), neffdpop(k)/real(n_tot_absorbed,fPrec), neffdpop(k), & - n_tot_absorbed, npartdpop(k) - end do - else - write(coll_efficDPUnit,"(a)") "No particles absorbed" end if - call f_close(coll_efficDPUnit) -#ifdef HDF5 - end if #endif - ! Write 2D efficiency file (eff vs. A_r and dp/p) + ! Write efficiency vs dp/p file #ifdef HDF5 - if(h5_useForCOLL .and. n_tot_absorbed /= 0) then - allocate(fldHdf(5)) - fldHdf(1) = h5_dataField(name="RAD_SIGMA", type=h5_typeReal) - fldHdf(2) = h5_dataField(name="DP/P", type=h5_typeReal) - fldHdf(3) = h5_dataField(name="N/TNABS", type=h5_typeReal) - fldHdf(4) = h5_dataField(name="N", type=h5_typeReal) - fldHdf(5) = h5_dataField(name="TNABS", type=h5_typeInt) - call h5_createFormat("collEfficiency2D", fldHdf, fmtHdf) - call h5_createDataSet("efficiency_2d", h5_collID, fmtHdf, setHdf, numeffdpop) - do i=1,numeff + if(h5_useForCOLL .and. n_tot_absorbed /= 0) then + allocate(fldHdf(5)) + fldHdf(1) = h5_dataField(name="DP/P", type=h5_typeReal) + fldHdf(2) = h5_dataField(name="NDPOP/TNABS", type=h5_typeReal) + fldHdf(3) = h5_dataField(name="NDPOP", type=h5_typeReal) + fldHdf(4) = h5_dataField(name="TNABS", type=h5_typeInt) + fldHdf(5) = h5_dataField(name="NPART", type=h5_typeInt) + call h5_createFormat("collEfficiencyDPOP", fldHdf, fmtHdf) + call h5_createDataSet("efficiency_dpop", h5_collID, fmtHdf, setHdf, numeffdpop) call h5_prepareWrite(setHdf, numeffdpop) - call h5_writeData(setHdf, 1, numeffdpop, rsig(i)) - call h5_writeData(setHdf, 2, numeffdpop, dpopbins(1:numeffdpop)) - call h5_writeData(setHdf, 3, numeffdpop, neff2d(i,1:numeffdpop)/real(n_tot_absorbed,fPrec)) - call h5_writeData(setHdf, 4, numeffdpop, neff2d(i,1:numeffdpop)) - call h5_writeData(setHdf, 5, numeffdpop, n_tot_absorbed) + call h5_writeData(setHdf, 1, numeffdpop, dpopbins(1:numeffdpop)) + call h5_writeData(setHdf, 2, numeffdpop, neffdpop(1:numeffdpop)/real(n_tot_absorbed,real64)) + call h5_writeData(setHdf, 3, numeffdpop, neffdpop(1:numeffdpop)) + call h5_writeData(setHdf, 4, numeffdpop, n_tot_absorbed) + call h5_writeData(setHdf, 5, numeffdpop, npartdpop(1:numeffdpop)) call h5_finaliseWrite(setHdf) - end do - deallocate(fldHdf) - else + deallocate(fldHdf) + else #endif - call f_requestUnit(coll_effic2DFile,coll_effic2DUnit) - call f_open(unit=coll_effic2DUnit,file=coll_effic2DFile,formatted=.true.,mode="w",status="replace") - if(n_tot_absorbed /= 0) then - write(coll_effic2DUnit,"(a1,1x,a13,3(1x,a15),1x,a8)") "#","rad_sigma","dp/p","n/tot_nabs","n","tot_nabs" - do i=1,numeff + call f_requestUnit(coll_efficDPFile,coll_efficDPUnit) + call f_open(unit=coll_efficDPUnit,file=coll_efficDPFile,formatted=.true.,mode="w",status="replace") + if(n_tot_absorbed /= 0) then + write(coll_efficDPUnit,"(a1,1x,a13,2(1x,a15),2(1x,a8))") "#","dp/p","n_dpop/tot_nabs","n_dpop","tot_nabs","npart" do k=1,numeffdpop - write(coll_effic2DUnit,"(e15.7,3(1x,e15.7),1x,i8)") rsig(i), dpopbins(k), & - neff2d(i,k)/real(n_tot_absorbed,fPrec), neff2d(i,k), n_tot_absorbed + write(coll_efficDPUnit,"(e15.7,2(1x,e15.7),2(1x,i8))") dpopbins(k), neffdpop(k)/real(n_tot_absorbed,fPrec), neffdpop(k), & + n_tot_absorbed, npartdpop(k) end do + else + write(coll_efficDPUnit,"(a)") "No particles absorbed" + end if + call f_close(coll_efficDPUnit) +#ifdef HDF5 + end if +#endif + + ! Write 2D efficiency file (eff vs. A_r and dp/p) +#ifdef HDF5 + if(h5_useForCOLL .and. n_tot_absorbed /= 0) then + allocate(fldHdf(5)) + fldHdf(1) = h5_dataField(name="RAD_SIGMA", type=h5_typeReal) + fldHdf(2) = h5_dataField(name="DP/P", type=h5_typeReal) + fldHdf(3) = h5_dataField(name="N/TNABS", type=h5_typeReal) + fldHdf(4) = h5_dataField(name="N", type=h5_typeReal) + fldHdf(5) = h5_dataField(name="TNABS", type=h5_typeInt) + call h5_createFormat("collEfficiency2D", fldHdf, fmtHdf) + call h5_createDataSet("efficiency_2d", h5_collID, fmtHdf, setHdf, numeffdpop) + do i=1,numeff + call h5_prepareWrite(setHdf, numeffdpop) + call h5_writeData(setHdf, 1, numeffdpop, rsig(i)) + call h5_writeData(setHdf, 2, numeffdpop, dpopbins(1:numeffdpop)) + call h5_writeData(setHdf, 3, numeffdpop, neff2d(i,1:numeffdpop)/real(n_tot_absorbed,fPrec)) + call h5_writeData(setHdf, 4, numeffdpop, neff2d(i,1:numeffdpop)) + call h5_writeData(setHdf, 5, numeffdpop, n_tot_absorbed) + call h5_finaliseWrite(setHdf) end do + deallocate(fldHdf) else - write(coll_effic2DUnit,"(a)") "No particles absorbed" - end if - call f_close(coll_effic2DUnit) +#endif + call f_requestUnit(coll_effic2DFile,coll_effic2DUnit) + call f_open(unit=coll_effic2DUnit,file=coll_effic2DFile,formatted=.true.,mode="w",status="replace") + if(n_tot_absorbed /= 0) then + write(coll_effic2DUnit,"(a1,1x,a13,3(1x,a15),1x,a8)") "#","rad_sigma","dp/p","n/tot_nabs","n","tot_nabs" + do i=1,numeff + do k=1,numeffdpop + write(coll_effic2DUnit,"(e15.7,3(1x,e15.7),1x,i8)") rsig(i), dpopbins(k), & + neff2d(i,k)/real(n_tot_absorbed,fPrec), neff2d(i,k), n_tot_absorbed + end do + end do + else + write(coll_effic2DUnit,"(a)") "No particles absorbed" + end if + call f_close(coll_effic2DUnit) #ifdef HDF5 - end if + end if #endif + end if ! Write collimation summary file #ifdef HDF5 @@ -3283,8 +2195,9 @@ subroutine collimate_exit call f_close(outlun) call f_close(coll_gapsUnit) call f_close(coll_positionsUnit) + call f_close(coll_survivalUnit) - if(dowritetracks) then + if(dowrite_tracks) then call f_close(coll_tracksUnit) #ifdef HDF5 if(h5_writeTracks2) call h5tr2_finalise @@ -3309,21 +2222,21 @@ subroutine collimate_exit ! Write amplitude.dat call f_requestUnit(coll_ampFile,coll_ampUnit) call f_open(unit=coll_ampUnit,file=coll_ampFile,formatted=.true.,mode="w",status="replace") - write(coll_ampUnit,"(a1,1x,a6,1x,a20,19(1x,a20))") "#","ielem",chr_rPad("name",20),"s","AX_AV","AX_RMS","AY_AV","AY_RMS",& - "alphax","alphay","betax","betay","orbitx","orbity","dispx","dispy","xbob","ybob","xpbob","ypbob","mux","muy" + write(coll_ampUnit,"(a1,1x,a6,1x,a20,17(1x,a20))") "#","ielem",chr_rPad("name",20),"s","AX_AV","AX_RMS","AY_AV","AY_RMS",& + "alphax","alphay","betax","betay","orbitx","orbity","dispx","dispy","xbob","ybob","xpbob","ypbob" do i=1,iu if(ic(i) <= nblo) then ix = mtyp(ic(i),mel(ic(i))) else ix = ic(i)-nblo end if - write(coll_ampUnit,"(i8,1x,a20,19(1x,1pe20.13))") i, bez(ix)(1:20), dcum(i), & + write(coll_ampUnit,"(i8,1x,a20,17(1x,1pe20.13))") i, bez(ix)(1:20), dcum(i), & sum_ax(i)/real(max(nampl(i),1),fPrec), & sqrt(abs((sqsum_ax(i)/real(max(nampl(i),1),fPrec))-(sum_ax(i)/real(max(nampl(i),1),fPrec))**2)), & sum_ay(i)/real(max(nampl(i),1),fPrec), & sqrt(abs((sqsum_ay(i)/real(max(nampl(i),1),fPrec))-(sum_ay(i)/real(max(nampl(i),1),fPrec))**2)), & talphax(i), talphay(i), tbetax(i), tbetay(i), torbx(i), torby(i), tdispx(i), tdispy(i), & - xbob(i), ybob(i), xpbob(i), ypbob(i), mux(i), muy(i) + xbob(i), ybob(i), xpbob(i), ypbob(i) end do call f_close(coll_ampUnit) end if @@ -3341,52 +2254,43 @@ subroutine collimate_exit call g4_terminate() #endif -end subroutine collimate_exit - -!> -!! This routine is called at the start of each tracking turn -!< -subroutine collimate_start_turn(n) - - use crcoall - use parpro - use mod_common - use mod_common_main - use mod_commons - use mod_common_track - use mod_common_da - - implicit none +end subroutine coll_exitCollimation +! ================================================================================================ ! +! This routine is called at the start of each tracking turn +! ================================================================================================ ! +subroutine coll_startTurn(n) integer, intent(in) :: n + iturn = n +end subroutine coll_startTurn - iturn=n - -end subroutine collimate_start_turn - -!> -!! This routine is called at the start of every element -!< -subroutine collimate_start_element(i) +! ================================================================================================ ! +! This routine is called at the start of every element +! ================================================================================================ ! +subroutine coll_startElement(iStru, iSing) use mod_common use mod_common_main + use coll_common - integer, intent(in) :: i + integer, intent(in) :: iStru + integer, intent(in) :: iSing integer j - ie=i + ie = iStru + c_ix = iSing + #ifndef G4COLLIMATION - ! For absorbed particles set all coordinates to zero. Also - ! include very large offsets, let's say above 100mm or 100mrad. + ! For absorbed particles set all coordinates to zero. + ! Also include very large offsets, let's say above 100mm or 100mrad. do j=1,napx - if((part_abs_pos(j) /= 0 .and. part_abs_turn(j) /= 0) .or. & - xv1(j) > c1e2 .or. yv1(j) > c1e2 .or. xv2(j) > c1e2 .or. yv2(j) > c1e2) then + if((part_abs_pos(j) /= 0 .and. part_abs_turn(j) /= 0) & + .or. xv1(j) > c1e2 .or. yv1(j) > c1e2 .or. xv2(j) > c1e2 .or. yv2(j) > c1e2) then xv1(j) = zero yv1(j) = zero xv2(j) = zero yv2(j) = zero - ejv(j) = myenom + ejv(j) = c_enom sigmv(j) = zero nabs_type(j) = 0 nhit_stage(j) = 0 @@ -3396,203 +2300,69 @@ subroutine collimate_start_element(i) end do #endif -!GRD SAVE COORDINATES OF PARTICLE 1 TO CHECK ORBIT - if(firstrun) then - xbob(ie)=xv1(1) - ybob(ie)=xv2(1) - xpbob(ie)=yv1(1) - ypbob(ie)=yv2(1) - end if - -!++ Here comes sixtrack stuff - if(ic(i) <= nblo) then - myix = mtyp(ic(i),mel(ic(i))) - else - myix = ic(i)-nblo + ! Save coordinates of particle 1 to check orbit for amplitude file + if(firstrun .and. dowrite_amplitude) then + xbob(ie) = xv1(1) + ybob(ie) = xv2(1) + xpbob(ie) = yv1(1) + ypbob(ie) = yv2(1) end if -end subroutine collimate_start_element +end subroutine coll_startElement -!> -!! collimate_end_element() -!! This routine is called at the end of every element -!< -subroutine collimate_end_element +! ================================================================================================ ! +! This routine is called at the end of every element +! ================================================================================================ ! +subroutine coll_endElement - use crcoall - use parpro use coll_common use mod_common - use mod_commons - use mod_common_da - use mod_common_main - use mod_common_track -#ifdef HDF5 - use hdf5_output - use hdf5_tracks2 -#endif - - implicit none - - integer j - -#ifdef HDF5 - integer hdfturn,hdfpid,hdftyp - real(kind=fPrec) hdfx,hdfxp,hdfy,hdfyp,hdfdee,hdfs -#endif - - if(firstrun) then - - if(iturn == 1) then - sum_ax(ie) = zero - sum_ay(ie) = zero - end if - - do j = 1, napx - xj = (xv1(j)-torbx(ie)) /c1e3 - xpj = (yv1(j)-torbxp(ie))/c1e3 - yj = (xv2(j)-torby(ie)) /c1e3 - ypj = (yv2(j)-torbyp(ie))/c1e3 - pj = ejv(j)/c1e3 - if(tbetax(ie).gt.zero) then - gammax = (one + talphax(ie)**2)/tbetax(ie) - gammay = (one + talphay(ie)**2)/tbetay(ie) - else - gammax = (one + talphax(ie-1)**2)/tbetax(ie-1) - gammay = (one + talphay(ie-1)**2)/tbetay(ie-1) - endif - - if(part_abs_pos(j).eq.0 .and. part_abs_turn(j).eq.0) then - if(tbetax(ie).gt.0.) then - nspx = sqrt(abs( gammax*(xj)**2 + two*talphax(ie)*xj*xpj + tbetax(ie)*xpj**2 )/myemitx0_collgap) - nspy = sqrt(abs( gammay*(yj)**2 + two*talphay(ie)*yj*ypj + tbetay(ie)*ypj**2 )/myemity0_collgap) - else - nspx = sqrt(abs( gammax*(xj)**2 + two*talphax(ie-1)*xj*xpj + tbetax(ie-1)*xpj**2 )/myemitx0_collgap) - nspy = sqrt(abs( gammay*(yj)**2 + two*talphay(ie-1)*yj*ypj + tbetay(ie-1)*ypj**2 )/myemity0_collgap) - end if - - sum_ax(ie) = sum_ax(ie) + nspx - sqsum_ax(ie) = sqsum_ax(ie) + nspx**2 - sum_ay(ie) = sum_ay(ie) + nspy - sqsum_ay(ie) = sqsum_ay(ie) + nspy**2 - nampl(ie) = nampl(ie) + 1 - else - nspx = zero - nspy = zero - end if - end do + if(firstrun .and. dowrite_amplitude) then + call coll_computeStats end if -!GRD THIS LOOP MUST NOT BE WRITTEN INTO THE "IF(FIRSTRUN)" LOOP !!!! - if (dowritetracks) then - do j = 1, napx - xj = (xv1(j)-torbx(ie)) /c1e3 - xpj = (yv1(j)-torbxp(ie))/c1e3 - yj = (xv2(j)-torby(ie)) /c1e3 - ypj = (yv2(j)-torbyp(ie))/c1e3 - - arcdx = 2.5_fPrec - arcbetax = c180e0 - - if (xj.le.zero) then - xdisp = xj + (pj-myenom)/myenom * arcdx* sqrt(tbetax(ie)/arcbetax) - else - xdisp = xj - (pj-myenom)/myenom * arcdx* sqrt(tbetax(ie)/arcbetax) - end if - - xndisp = xj - - nspxd = sqrt(abs(gammax*xdisp**2 + two*talphax(ie)*xdisp*xpj + tbetax(ie)*xpj**2)/myemitx0_collgap) - nspx = sqrt(abs(gammax*xndisp**2 + two*talphax(ie)*xndisp*xpj + tbetax(ie)*xpj**2)/myemitx0_collgap) - nspy = sqrt(abs(gammay*yj**2 + two*talphay(ie)*yj*ypj + tbetay(ie)*ypj**2)/myemity0_collgap) - - if(part_abs_pos(j).eq.0 .and. part_abs_turn(j).eq.0) then - -!GRD HERE WE APPLY THE SAME KIND OF CUT THAN THE SIGSECUT PARAMETER - if(nhit_stage(j) > 0 .and. & - (xv1(j).lt.99.0_fPrec .and. xv2(j).lt.99.0_fPrec) .and. & - ((((xv1(j)*c1m3)**2 / (tbetax(ie)*myemitx0_collgap)) .ge. sigsecut2).or. & - (((xv2(j)*c1m3)**2 / (tbetay(ie)*myemity0_collgap)) .ge. sigsecut2).or. & - (((xv1(j)*c1m3)**2 / (tbetax(ie)*myemitx0_collgap)) + & - ((xv2(j)*c1m3)**2 / (tbetay(ie)*myemity0_collgap)) .ge. sigsecut3)) ) then - - xj = (xv1(j)-torbx(ie)) /c1e3 - xpj = (yv1(j)-torbxp(ie))/c1e3 - yj = (xv2(j)-torby(ie)) /c1e3 - ypj = (yv2(j)-torbyp(ie))/c1e3 -#ifdef HDF5 - if(h5_writeTracks2) then - call h5tr2_writeLine(partID(j),iturn,dcum(ie),xv1(j),yv1(j),xv2(j),yv2(j),& - (ejv(j)-myenom)/myenom,nhit_stage(j)) - else -#endif - write(coll_tracksUnit,"(1x,i8,1x,i4,1x,f10.2,4(1x,e12.5),1x,e11.3,1x,i4)") partID(j), iturn, dcum(ie), & - xv1(j), yv1(j), xv2(j), yv2(j), (ejv(j)-myenom)/myenom, nhit_stage(j) -#ifdef HDF5 - end if -#endif - end if - end if - end do - end if !!JUNE2005 here I close the "if(dowritetracks)" outside of the firstrun flag + ! Note: Not in firstrun + if(dowrite_tracks) then + call coll_writeTracks2(2) + end if -end subroutine collimate_end_element +end subroutine coll_endElement -!> -!! collimate_end_turn() -!! This routine is called at the end of every turn -!< -subroutine collimate_end_turn +! ================================================================================================ ! +! This routine is called at the end of every turn +! ================================================================================================ ! +subroutine coll_endTurn - use parpro - use coll_common + use mod_time + use mod_units use mod_common - use mod_commons - use mod_common_da use mod_common_main use mod_common_track - use crcoall - use mod_units - use mathlib_bouncer - + use coll_common #ifdef ROOT use root_output #endif #ifdef HDF5 use hdf5_output - use hdf5_tracks2 #endif - implicit none - - integer j, fUnit - + integer j,fUnit #ifdef HDF5 - ! For tracks2 - integer hdfturn,hdfpid,hdftyp - real(kind=fPrec) hdfx,hdfxp,hdfy,hdfyp,hdfdee,hdfs ! For other output type(h5_dataField), allocatable :: fldHdf(:) integer fmtHdf, setHdf #endif -!__________________________________________________________________ -!++ Now do analysis at selected elements... - -!++ Save twiss functions of present element - ax0 = talphax(ie) - bx0 = tbetax(ie) - mux0 = mux(ie) - ay0 = talphay(ie) - by0 = tbetay(ie) - muy0 = muy(ie) + call time_startClock(time_clockCOLL) do j=1,napx - xineff(j) = xv1(j) - torbx (ie) - xpineff(j) = yv1(j) - torbxp(ie) - yineff(j) = xv2(j) - torby (ie) - ypineff(j) = yv2(j) - torbyp(ie) + if(dowrite_efficiency) then + xineff(j) = xv1(j) - torbx (ie) + xpineff(j) = yv1(j) - torbxp(ie) + yineff(j) = xv2(j) - torby (ie) + ypineff(j) = yv2(j) - torbyp(ie) + end if ! All particles absorbed are considered to be lost, so we give them a large offset if(part_abs_pos(j) /= 0 .and. part_abs_turn(j) /= 0) then xv1(j) = 99.5_fPrec @@ -3603,8 +2373,8 @@ subroutine collimate_end_turn ! For LAST ELEMENT in the ring calculate the number of surviving ! particles and save into file versus turn number if(ie == iu) then - nsurvive = 0 + nsurvive = 0 do j=1,napx if(xv1(j) < 99.0_fPrec .and. xv2(j) < 99.0_fPrec) then nsurvive = nsurvive + 1 @@ -3635,130 +2405,14 @@ subroutine collimate_end_turn end if end if -!======================================================================= -!++ Do collimation analysis at element 20 ("zero" turn) or LAST -!++ ring element. - -!++ If selecting, look at number of scattered particles at selected -!++ collimator. For the "zero" turn consider the information at element -!++ 20 (before collimation), otherwise take information at last ring -!++ element. - if(do_coll .and. ((iturn == 1 .and. ie == 20) .or. (ie == iu))) then - gammax = (1 + talphax(ie)**2)/tbetax(ie) - gammay = (1 + talphay(ie)**2)/tbetay(ie) - - do j = 1, napx - ! Do the binning in amplitude, only considering particles that were not absorbed before. - if(xv1(j) < 99.0_fPrec .and. xv2(j) < 99.0_fPrec .and. (part_select(j) == 1 .or. ie == 20)) then - ! Normalized amplitudes are calculated - ! Allow to apply some dispersive offset. Take arc dispersion (2m) and normalize with arc beta_x function (180m). - arcdx = 2.5_fPrec - arcbetax = c180e0 - xdisp = abs(xv1(j)*c1m3) + (abs((ejv(j)-myenom)/myenom)*arcdx) * sqrt(tbetax(ie)/arcbetax) - nspx = sqrt( & - abs(gammax*xdisp**2 + & - ((two*talphax(ie))*xdisp)*(yv1(j)*c1m3) + & - tbetax(ie)*(yv1(j)*c1m3)**2 & - )/myemitx0_collgap & - ) - nspy = sqrt( & - abs(gammay*(xv2(j)*c1m3)**2 + & - ((two*talphay(ie))*(xv2(j)*c1m3))*(yv2(j)*c1m3) + & - tbetay(ie)*(yv2(j)*c1m3)**2 & - )/myemity0_collgap & - ) - -!++ Populate the efficiency arrays at the end of each turn... -! Modified by M.Fiascaris, July 2016 - if(ie.eq.iu) then - do ieff = 1, numeff - if(counted_r(j,ieff).eq.0 .and. sqrt( & - &((xineff(j)*c1m3)**2 + (talphax(ie)*xineff(j)*c1m3 + tbetax(ie)*xpineff(j)*c1m3)**2)/(tbetax(ie)*myemitx0_collgap)+& - &((yineff(j)*c1m3)**2 + (talphay(ie)*yineff(j)*c1m3 + tbetay(ie)*ypineff(j)*c1m3)**2)/(tbetay(ie)*myemity0_collgap))& - &.ge.rsig(ieff)) then - neff(ieff) = neff(ieff)+one - counted_r(j,ieff)=1 - end if - -!++ 2D eff - do ieffdpop = 1, numeffdpop - if(counted2d(j,ieff,ieffdpop).eq.0 .and.abs((ejv(j)-myenom)/myenom).ge.dpopbins(ieffdpop)) then - neff2d(ieff,ieffdpop) = neff2d(ieff,ieffdpop)+one - counted2d(j,ieff,ieffdpop)=1 - end if - end do - - if(counted_x(j,ieff).eq.0 .and.sqrt(((xineff(j)*c1m3)**2 + & - &(talphax(ie)*xineff(j)*c1m3 + tbetax(ie)*xpineff(j)*c1m3)**2)/(tbetax(ie)*myemitx0_collgap)).ge.rsig(ieff)) then - neffx(ieff) = neffx(ieff) + one - counted_x(j,ieff)=1 - end if - - if(counted_y(j,ieff).eq.0 .and. & - &sqrt(((yineff(j)*c1m3)**2 + (talphay(ie)*yineff(j)*c1m3 + tbetay(ie)*ypineff(j)*c1m3)**2)/ & - &tbetay(ie)*myemity0_collgap).ge.rsig(ieff)) then - neffy(ieff) = neffy(ieff) + one - counted_y(j,ieff)=1 - end if - end do !do ieff = 1, numeff - - do ieffdpop = 1, numeffdpop - if(counteddpop(j,ieffdpop).eq.0) then - dpopmin = zero - mydpop = abs((ejv(j)-myenom)/myenom) - if(ieffdpop.gt.1) dpopmin = dpopbins(ieffdpop-1) - - dpopmax = dpopbins(ieffdpop) - if(mydpop.ge.dpopmin .and. mydpop.lt.mydpop) then - npartdpop(ieffdpop)=npartdpop(ieffdpop)+1 - end if - end if - - if(counteddpop(j,ieffdpop).eq.0 .and.abs((ejv(j)-myenom)/myenom).ge.dpopbins(ieffdpop)) then - neffdpop(ieffdpop) = neffdpop(ieffdpop)+one - counteddpop(j,ieffdpop)=1 - end if - end do !do ieffdpop = 1, numeffdpop - end if !if(ie.eq.iu) then - -!++ Do an emittance drift - driftx = driftsx*sqrt(tbetax(ie)*myemitx0_collgap) - drifty = driftsy*sqrt(tbetay(ie)*myemity0_collgap) - - if(ie.eq.iu) then - dnormx = driftx / sqrt(tbetax(ie)*myemitx0_collgap) - dnormy = drifty / sqrt(tbetay(ie)*myemity0_collgap) - xnorm = (xv1(j)*c1m3) / sqrt(tbetax(ie)*myemitx0_collgap) - xpnorm = (talphax(ie)*(xv1(j)*c1m3)+ tbetax(ie)*(yv1(j)*c1m3)) / sqrt(tbetax(ie)*myemitx0_collgap) - xangle = atan2_mb(xnorm,xpnorm) - xnorm = xnorm + dnormx*sin_mb(xangle) - xpnorm = xpnorm + dnormx*cos_mb(xangle) - xv1(j) = c1e3 * (xnorm * sqrt(tbetax(ie)*myemitx0_collgap)) - yv1(j) = c1e3 * ((xpnorm*sqrt(tbetax(ie)*myemitx0_collgap)-talphax(ie)*xv1(j)*c1m3)/tbetax(ie)) - - ynorm = (xv2(j)*c1m3)/ sqrt(tbetay(ie)*myemity0_collgap) - ypnorm = (talphay(ie)*(xv2(j)*c1m3)+tbetay(ie)*(yv2(j)*c1m3)) / sqrt(tbetay(ie)*myemity0_collgap) - yangle = atan2_mb(ynorm,ypnorm) - ynorm = ynorm + dnormy*sin_mb(yangle) - ypnorm = ypnorm + dnormy*cos_mb(yangle) - xv2(j) = c1e3 * (ynorm * sqrt(tbetay(ie)*myemity0_collgap)) - yv2(j) = c1e3 * ((ypnorm*sqrt(tbetay(ie)*myemity0_collgap)-talphay(ie)*xv2(j)*c1m3)/tbetay(ie)) - end if - -!------------------------------------------------------------------------ -!++ End of check for selection flag and absorption - end if -!++ End of do loop over particles - end do -!_________________________________________________________________ -!++ End of collimation efficiency analysis for selected particles + if(iturn == 1 .or. ie == iu) then + call coll_doEfficiency end if -!------------------------------------------------------------------ -!++ For LAST ELEMENT in the ring compact the arrays by moving all -!++ lost particles to the end of the array. + ! For LAST ELEMENT in the ring compact the arrays by moving all + ! lost particles to the end of the array. if(ie == iu) then - do j = 1, napx + do j=1, napx if(xv1(j) < 99.0_fPrec .and. xv2(j) < 99.0_fPrec) then llostp(j) = .false. else @@ -3807,99 +2461,924 @@ subroutine collimate_end_turn #endif end if - if(firstrun) then + ! Call end element one extra time + call coll_endElement - if(iturn == 1) then - sum_ax(ie) = zero - sum_ay(ie) = zero - end if + call time_stopClock(time_clockCOLL) - do j=1,napx - xj = (xv1(j)-torbx(ie)) /c1e3 - xpj = (yv1(j)-torbxp(ie))/c1e3 - yj = (xv2(j)-torby(ie)) /c1e3 - ypj = (yv2(j)-torbyp(ie))/c1e3 - pj = ejv(j)/c1e3 - - if(tbetax(ie) > 0.) then - gammax = (one + talphax(ie)**2)/tbetax(ie) - gammay = (one + talphay(ie)**2)/tbetay(ie) +end subroutine coll_endTurn + +! ================================================================================================ ! +! R. Bruce +! +! Create distribution where the normalized distance between jaw and beam is the smallest. +! This is where particles will first impact: +! Without imperfections, it is: +! - at the face of the collimator for the case of beta'<0 (POSITIVE alpha - beam converging) and +! - at the exit of the collimator for the case of beta'>0 (NEGATIVE alpha beam diverging) +! With imperfections: +! - include errors on gap, tilt and offset. We have to calculate the normalized distance to each +! corner separately! +! +! Calculate optical parameters at start and end of collimator (half a collimator length upstream +! and downstream of present s-position). Assuming a purely vertical or horizontal halo - need to +! add more conditions for other cases! +! +! Using standard twiss transfer matrix for a drift at start of collimator +! ================================================================================================ ! +subroutine coll_matchedHalo(c_tilt,c_offset,c_aperture,c_length) + + use crcoall + use coll_dist + use mod_common + use mod_common_main + use mod_common_track + use mathlib_bouncer + + real(kind=fPrec), intent(in) :: c_tilt(2) + real(kind=fPrec), intent(in) :: c_offset + real(kind=fPrec), intent(in) :: c_aperture + real(kind=fPrec), intent(in) :: c_length + + integer j + real(kind=fPrec) Nap1pos,Nap2pos,Nap1neg,Nap2neg,tiltOffsPos1,tiltOffsPos2,tiltOffsNeg1, & + tiltOffsNeg2,beamsize1,beamsize2,minAmpl,ldrift,c_nex2,c_ney2,betax1,betax2,betay1,betay2, & + alphax1,alphax2,alphay1,alphay2 + + ! Assign the drift length over which the optics functions are propagated + ldrift = -c_length/two + betax1 = tbetax(ie) - two*ldrift*talphax(ie) + (ldrift**2 * (one+talphax(ie)**2))/tbetax(ie) + betay1 = tbetay(ie) - two*ldrift*talphay(ie) + (ldrift**2 * (one+talphay(ie)**2))/tbetay(ie) + + alphax1 = talphax(ie) - (ldrift*(1+talphax(ie)**2))/tbetax(ie) + alphay1 = talphay(ie) - (ldrift*(1+talphay(ie)**2))/tbetay(ie) + + ! At end of collimator: + ldrift = c_length/two + betax2 = tbetax(ie) - two*ldrift*talphax(ie) + (ldrift**2 * (one+talphax(ie)**2))/tbetax(ie) + betay2 = tbetay(ie) - two*ldrift*talphay(ie) + (ldrift**2 * (one+talphay(ie)**2))/tbetay(ie) + + alphax2 = talphax(ie) - (ldrift*(1+talphax(ie)**2))/tbetax(ie) + alphay2 = talphay(ie) - (ldrift*(1+talphay(ie)**2))/tbetay(ie) + + ! Calculate beam size at start and end of collimator. account for collimation plane + if(cdist_ampX > zero .and. cdist_ampY == zero) then ! Horizontal halo + beamsize1 = sqrt(betax1 * c_emitx0_collgap) + beamsize2 = sqrt(betax2 * c_emitx0_collgap) + else if(cdist_ampX == zero .and. cdist_ampY > zero) then ! Vertical halo + beamsize1 = sqrt(betay1 * c_emity0_collgap) + beamsize2 = sqrt(betay2 * c_emity0_collgap) + else + write(lerr,"(a)") "COLL> ERROR Attempting to use a halo not purely in the horizontal "//& + "or vertical plane with pencil_dist=3 - abort." + call prror + end if + + ! Calculate offset from tilt of positive and negative jaws, at start and end + ! Remember: tilt angle is defined such that one corner stays at nominal position, the other corner is more open + + ! Jaw in positive x (or y): + if(c_tilt(1) >= zero) then + tiltOffsPos1 = zero + tiltOffsPos2 = abs(sin_mb(c_tilt(1))) * c_length + else + tiltOffsPos1 = abs(sin_mb(c_tilt(1))) * c_length + tiltOffsPos2 = zero + end if + + ! Jaw in negative x (or y): + if(c_tilt(2) >= zero) then + tiltOffsNeg1 = abs(sin_mb(c_tilt(2))) * c_length + tiltOffsNeg2 = zero + else + tiltOffsNeg1 = zero + tiltOffsNeg2 = abs(sin_mb(c_tilt(2))) * c_length + end if + + ! Calculate half distance from jaws to beam center (in units of beam sigma) at the beginning of the collimator, + ! Positive and neg jaws. + Nap1pos = ((c_aperture/two + c_offset) + tiltOffsPos1)/beamsize1 + Nap2pos = ((c_aperture/two + c_offset) + tiltOffsPos2)/beamsize2 + Nap1neg = ((c_aperture/two - c_offset) + tiltOffsNeg1)/beamsize1 + Nap2neg = ((c_aperture/two - c_offset) + tiltOffsNeg2)/beamsize2 + + ! Minimum normalized distance from jaw to beam center - this is the n_sigma at which the halo should be generated + minAmpl = min(Nap1pos,Nap2pos,Nap1neg,Nap2neg) + + ! Assign amplitudes in x and y for the halo generation function + if(cdist_ampX > zero .and. cdist_ampY == zero) then ! Horizontal halo + c_nex2 = minAmpl + else if(cdist_ampX == zero .and. cdist_ampY > zero) then ! Vertical halo + c_ney2 = minAmpl + end if ! Other cases taken care of above - in these cases, program has already stopped + + ! Assign optics parameters to use for the generation of the starting halo - at start or end of collimator + if(minAmpl == Nap1pos .or. minAmpl == Nap1neg) then ! min normalized distance occurs at start of collimator + ldrift = -c_length/two + else ! Min normalized distance occurs at end of collimator + ldrift = c_length/two + end if + + ! create new pencil beam distribution with spread at start or end of collimator at the minAmpl + ! note: if imperfections are active, equal amounts of particles are still generated on the two jaws. + ! but it might be then that only one jaw is hit on the first turn, thus only by half of the particles + ! the particle generated on the other side will then hit the same jaw several turns later, possibly smearing the impact parameter + ! This could possibly be improved in the future. + call cdist_makeDist_coll(alphax1,alphay1,betax1,betay1,c_nex2,c_ney2) + + do j=1,napx + xv1(j) = c1e3*xv1(j) + torbx(ie) + yv1(j) = c1e3*yv1(j) + torbxp(ie) + xv2(j) = c1e3*xv2(j) + torby(ie) + yv2(j) = c1e3*yv2(j) + torbyp(ie) + + ! as main routine will track particles back half a collimator length (to start of jaw), + ! track them now forward (if generated at face) or backward (if generated at end) + ! 1/2 collimator length to center of collimator (ldrift pos or neg) + xv1(j) = xv1(j) - ldrift*yv1(j) + xv2(j) = xv2(j) - ldrift*yv2(j) + end do + +end subroutine coll_matchedHalo + +! ================================================================================================ ! +! Find the smallest gap, and also write sigmasettings.out +! Updated: 2019-10-10 +! ================================================================================================ ! +subroutine coll_getMinGapID(minGapID) + + use coll_db + use coll_common + use mod_units + use string_tools + use mathlib_bouncer + use mod_common_track + + integer, intent(out) :: minGapID + + integer i,j + real(kind=fPrec) gapH1,gapH2,gapH3,gapH4,minGap,nSigErr,sigOffset + + call f_requestUnit(coll_sigmaSetFile,coll_sigmaSetUnit) + call f_open(unit=coll_sigmaSetUnit,file=coll_sigmaSetFile,formatted=.true.,mode="w",status="replace") + write(coll_sigmaSetUnit,"(a1,1x,a18,12(1x,a16))") "#",chr_rPad("collimator",18),& + "gap_h1","gap_h2","gap_h3","gap_h4","sig_offset","coll_offset","nsig", & + "gap_rms_error","beta_x","beta_y","orb_x","orb_y" + + minGap = 20.0_fPrec + do i=1,cdb_nColl + ! Start searching minimum gap + if(cdb_cFound(i) .and. cdb_cLength(i) > zero) then + nSigErr = cdb_cNSig(i) + gap_rms_error(i) + + ! Jaw 1 on positive side x-axis + gapH1 = nSigErr - sin_mb(cdb_cTilt(1,i))*cdb_cLength(i)/2 + gapH2 = nSigErr + sin_mb(cdb_cTilt(1,i))*cdb_cLength(i)/2 + + ! Jaw 2 on negative side of x-axis (see change of sign compared + ! to above code lines, alos have a look to setting of tilt angle) + gapH3 = nSigErr + sin_mb(cdb_cTilt(2,i))*cdb_cLength(i)/2 + gapH4 = nSigErr - sin_mb(cdb_cTilt(2,i))*cdb_cLength(i)/2 + + j = cdb_struMap(i) ! The structure index of the collimator + if(do_nominal) then + bx_dist = cdb_cBx(i) + by_dist = cdb_cBy(i) else - gammax = (one + talphax(ie-1)**2)/tbetax(ie-1) - gammay = (one + talphay(ie-1)**2)/tbetay(ie-1) + bx_dist = tbetax(j) + by_dist = tbetay(j) end if - if(part_abs_pos(j) == 0 .and. part_abs_turn(j) == 0) then - if(tbetax(ie) > 0.) then - nspx = sqrt(abs( gammax*(xj)**2 + two*talphax(ie)*xj*xpj + tbetax(ie)*xpj**2 )/myemitx0_collgap) - nspy = sqrt(abs( gammay*(yj)**2 + two*talphay(ie)*yj*ypj + tbetay(ie)*ypj**2 )/myemity0_collgap) - else - nspx = sqrt(abs( gammax*(xj)**2 + two*talphax(ie-1)*xj*xpj +tbetax(ie-1)*xpj**2 )/myemitx0_collgap) - nspy = sqrt(abs( gammay*(yj)**2 + two*talphay(ie-1)*yj*ypj +tbetay(ie-1)*ypj**2 )/myemity0_collgap) - end if + sigOffset = cdb_cOffset(i)/(sqrt(bx_dist**2 * cos_mb(cdb_cRotation(i))**2 + by_dist**2 * sin_mb(cdb_cRotation(i))**2)) + write(coll_sigmaSetUnit,"(a20,7(1x,f16.6),1x,1pe16.9,4(1x,f16.6))") cdb_cName(i),& + gapH1,gapH2,gapH3,gapH4,sigOffset,cdb_cOffset(i),cdb_cNSig(i),gap_rms_error(i),& + tbetax(j),tbetay(j),torbx(j),torby(j) + + if((gapH1 + sigOffset) <= minGap) then + minGap = gapH1 + sigOffset + minGapID = i + else if((gapH2 + sigOffset) <= minGap) then + minGap = gapH2 + sigOffset + minGapID = i + else if((gapH3 - sigOffset) <= minGap) then + minGap = gapH3 - sigOffset + minGapID = i + else if((gapH4 - sigOffset) <= minGap) then + minGap = gapH4 - sigOffset + minGapID = i + end if + end if + end do - sum_ax(ie) = sum_ax(ie) + nspx - sqsum_ax(ie) = sqsum_ax(ie) + nspx**2 - sum_ay(ie) = sum_ay(ie) + nspy - sqsum_ay(ie) = sqsum_ay(ie) + nspy**2 - nampl(ie) = nampl(ie) + 1 - else - nspx = zero - nspy = zero - end if !if(part_abs_pos(j).eq.0 .and. part_abs_turn(j).eq.0) then - end do !do j = 1, napx - end if !if(firstrun) then - -!GRD THIS LOOP MUST NOT BE WRITTEN INTO THE "IF(FIRSTRUN)" LOOP !!!! - if(dowritetracks) then - do j=1, napx - xj = (xv1(j)-torbx(ie))/c1e3 - xpj = (yv1(j)-torbxp(ie))/c1e3 - yj = (xv2(j)-torby(ie))/c1e3 - ypj = (yv2(j)-torbyp(ie))/c1e3 - arcdx = 2.5_fPrec - arcbetax = c180e0 - - if(xj <= 0.) then - xdisp = xj + (pj-myenom)/myenom * arcdx * sqrt(tbetax(ie)/arcbetax) - else - xdisp = xj - (pj-myenom)/myenom * arcdx * sqrt(tbetax(ie)/arcbetax) + write(coll_sigmaSetUnit, "(a)") "" + write(coll_sigmaSetUnit, "(a)") "# SUMMARY" + write(coll_sigmaSetUnit, "(a)") "# MinGap Collimator: '"//trim(cdb_cName(minGapID))//"'" + write(coll_sigmaSetUnit, "(a,i0)") "# MinGap Coll ID: ",minGapID + write(coll_sigmaSetUnit, "(a,f0.6)") "# Min Gap Sigma: ",minGap + write(coll_sigmaSetUnit, "(a,i0)") "# Pencil Initial: ",ipencil + + if(ipencil > 0 .and. do_mingap) then + write(coll_sigmaSetUnit, "(a,i0)") "# Pencil (do_mingap): ",minGapID + end if + write(coll_sigmaSetUnit, "(a,i0)") "# Seed before reinit: ",rnd_seed + + call f_close(coll_sigmaSetUnit) + +end subroutine coll_getMinGapID + +! ================================================================================================ ! +! Do collimation analysis at last element. +! If selecting, look at number of scattered particles at selected collimator. +! ================================================================================================ ! +subroutine coll_doEfficiency + + use mod_common + use mod_common_main + use mod_common_track + use mathlib_bouncer + use coll_common + + integer j,ieff,ieffdpop + real(kind=fPrec) xnorm,xpnorm,ynorm,ypnorm,xangle,yangle,driftx,drifty + real(kind=fPrec) dpopmin,dpopmax,dnormx,dnormy,c_dpop + real(kind=fPrec) sigX,sigY,sigX2,sigY2,cSigEffX,cSigEffY,cSigEff + + sigX2 = tbetax(ie)*c_emitx0_collgap + sigY2 = tbetay(ie)*c_emity0_collgap + sigX = sqrt(sigX2) + sigY = sqrt(sigY2) + + do j=1,napx + + ! Do the binning in amplitude, only considering particles that were not absorbed before. + if(part_abs_pos(j) == 0 .and. part_abs_turn(j) == 0 .and. part_select(j) == 1) then + + ! Populate the efficiency arrays at the end of each turn. + if(ie == iu .and. dowrite_efficiency) then + + cSigEffX = ((xineff(j)*c1m3)**2 + (talphax(ie)*xineff(j)*c1m3 + tbetax(ie)*xpineff(j)*c1m3)**2)/sigX2 + cSigEffY = ((yineff(j)*c1m3)**2 + (talphay(ie)*yineff(j)*c1m3 + tbetay(ie)*ypineff(j)*c1m3)**2)/sigY2 + + cSigEff = sqrt(cSigEffX + cSigEffY) + cSigEffX = sqrt(cSigEffX) + cSigEffY = sqrt(cSigEffY) + + do ieff=1,numeff + if(counted_r(j,ieff) == 0 .and. cSigEff >= rsig(ieff)) then + neff(ieff) = neff(ieff) + one + counted_r(j,ieff) = 1 + end if + + if(counted_x(j,ieff) == 0 .and. cSigEffX >= rsig(ieff)) then + neffx(ieff) = neffx(ieff) + one + counted_x(j,ieff) = 1 + end if + + if(counted_y(j,ieff) == 0 .and. cSigEffY >= rsig(ieff)) then + neffy(ieff) = neffy(ieff) + one + counted_y(j,ieff) = 1 + end if + + ! 2D eff + do ieffdpop=1,numeffdpop + if(counted2d(j,ieff,ieffdpop) == 0 .and. abs((ejv(j)-c_enom)/c_enom) >= dpopbins(ieffdpop)) then + neff2d(ieff,ieffdpop) = neff2d(ieff,ieffdpop) + one + counted2d(j,ieff,ieffdpop) = 1 + end if + end do + end do + + do ieffdpop=1,numeffdpop + if(counteddpop(j,ieffdpop) == 0) then + dpopmin = zero + c_dpop = abs((ejv(j)-c_enom)/c_enom) + if(ieffdpop > 1) then + dpopmin = dpopbins(ieffdpop-1) + end if + + dpopmax = dpopbins(ieffdpop) + if(c_dpop >= dpopmin .and. c_dpop < dpopmax) then + npartdpop(ieffdpop) = npartdpop(ieffdpop) + 1 + end if + end if + + if(counteddpop(j,ieffdpop) == 0 .and. abs((ejv(j)-c_enom)/c_enom) >= dpopbins(ieffdpop)) then + neffdpop(ieffdpop) = neffdpop(ieffdpop) + one + counteddpop(j,ieffdpop) = 1 + end if + end do + end if + + ! Do an emittance drift + driftx = driftsx*sigX + drifty = driftsy*sigY + + if(ie == iu) then + dnormx = driftx/sigX + dnormy = drifty/sigY + + xnorm = (xv1(j)*c1m3)/sigX + xpnorm = (talphax(ie)*(xv1(j)*c1m3) + tbetax(ie)*(yv1(j)*c1m3))/sigX + xangle = atan2_mb(xnorm,xpnorm) + xnorm = xnorm + dnormx*sin_mb(xangle) + xpnorm = xpnorm + dnormx*cos_mb(xangle) + xv1(j) = c1e3*(xnorm*sigX) + yv1(j) = c1e3*((xpnorm*sigX - (talphax(ie)*xv1(j))*c1m3)/tbetax(ie)) + + ynorm = (xv2(j)*c1m3)/sigY + ypnorm = (talphay(ie)*(xv2(j)*c1m3) + tbetay(ie)*(yv2(j)*c1m3))/sigY + yangle = atan2_mb(ynorm,ypnorm) + ynorm = ynorm + dnormy*sin_mb(yangle) + ypnorm = ypnorm + dnormy*cos_mb(yangle) + xv2(j) = c1e3*(ynorm*sigY) + yv2(j) = c1e3*((ypnorm*sigY - (talphay(ie)*xv2(j))*c1m3)/tbetay(ie)) end if + end if + end do + +end subroutine coll_doEfficiency + +! ================================================================================================ ! +! WRITE TO FILES +! ================================================================================================ ! + +subroutine coll_writeImpactAbsorb + + use mod_common + use mod_common_main + use coll_common + + integer j - xndisp = xj - nspxd = sqrt(abs(gammax*xdisp**2 + two*talphax(ie)*xdisp*xpj + tbetax(ie)*xpj**2)/myemitx0_collgap) - nspx = sqrt(abs(gammax*xndisp**2 + two*talphax(ie)*xndisp*xpj + tbetax(ie)*xpj**2)/myemitx0_collgap) - nspy = sqrt(abs( gammay*yj**2 + two*talphay(ie)*yj*ypj + tbetay(ie)*ypj**2)/myemity0_collgap) - - if(part_abs_pos(j).eq.0 .and. part_abs_turn(j).eq.0) then -!GRD HERE WE APPLY THE SAME KIND OF CUT THAN THE SIGSECUT PARAMETER - if(nhit_stage(j) > 0 .and. & - (xv1(j).lt.99.0_fPrec .and. xv2(j).lt.99.0_fPrec) .and. & - ((((xv1(j)*c1m3)**2 / (tbetax(ie)*myemitx0_collgap)) .ge. sigsecut2).or. & - (((xv2(j)*c1m3)**2 / (tbetay(ie)*myemity0_collgap)) .ge. sigsecut2).or. & - (((xv1(j)*c1m3)**2 / (tbetax(ie)*myemitx0_collgap)) + & - ((xv2(j)*c1m3)**2 / (tbetay(ie)*myemity0_collgap)) .ge. sigsecut3)) ) then - - xj = (xv1(j)-torbx(ie))/c1e3 - xpj = (yv1(j)-torbxp(ie))/c1e3 - yj = (xv2(j)-torby(ie))/c1e3 - ypj = (yv2(j)-torbyp(ie))/c1e3 + do j=1,napx + ! First check for particle interaction at this collimator and this turn + if(part_hit_pos(j) == ie .and. part_hit_turn(j) == iturn) then + ! Fill the change in particle angle into histogram #ifdef HDF5 - if(h5_writeTracks2) then - call h5tr2_writeLine(partID(j),iturn,dcum(ie),xv1(j),yv1(j),xv2(j),yv2(j),& - (ejv(j)-myenom)/myenom,nhit_stage(j)) - else + if(h5_useForCOLL) then + call h5_prepareWrite(coll_hdf5_allImpacts, 1) + call h5_writeData(coll_hdf5_allImpacts, 1, 1, partID(j)) + call h5_writeData(coll_hdf5_allImpacts, 2, 1, iturn) + call h5_writeData(coll_hdf5_allImpacts, 3, 1, dcum(ie)) + call h5_finaliseWrite(coll_hdf5_allImpacts) + else #endif - write(coll_tracksUnit,"(1x,i8,1x,i4,1x,f10.2,4(1x,e12.5),1x,e11.3,1x,i4)") partID(j),iturn,dcum(ie), & - xv1(j),yv1(j),xv2(j),yv2(j),(ejv(j)-myenom)/myenom,nhit_stage(j) + write(coll_allImpactUnit,"(i8,1x,i4,1x,f8.2)") partID(j),iturn,dcum(ie) #ifdef HDF5 - end if + end if #endif + if(part_abs_pos(j) /= 0 .and. part_abs_turn(j) /= 0) then +#ifdef HDF5 + if(h5_useForCOLL) then + call h5_prepareWrite(coll_hdf5_allAbsorb, 1) + call h5_writeData(coll_hdf5_allAbsorb, 1, 1, partID(j)) + call h5_writeData(coll_hdf5_allAbsorb, 2, 1, iturn) + call h5_writeData(coll_hdf5_allAbsorb, 3, 1, dcum(ie)) + call h5_finaliseWrite(coll_hdf5_allAbsorb) + else +#endif + write(coll_allAbsorbUnit,"(i8,1x,i8,1x,f10.3)") partID(j),iturn,dcum(ie) +#ifdef HDF5 + end if +#endif + end if + end if + end do + +end subroutine coll_writeImpactAbsorb + +! ================================================================================================ ! +! For a SELECTED collimator only consider particles that were scattered on this selected +! collimator at the first turn. All other particles are discarded. +! - This is switched on with the DO_SELECT flag in the input file. +! - Note that the part_select(j) flag defaults to 1 for all particles. +! ================================================================================================ ! +subroutine coll_writeSelectedCollimator + + use crcoall + use mod_units + use mod_common + use coll_common + + integer j, n_impact, num_selabs, num_surhit + real(kind=fPrec) average, sigma, sum, sqsum + + n_impact = 0 + num_selhit = 0 + num_surhit = 0 + num_selabs = 0 + sum = zero + sqsum = zero + + if(dowrite_impact) then + call f_requestUnit(coll_impactFile,coll_impactUnit) + call f_open(unit=coll_impactUnit,file=coll_impactFile,formatted=.true.,mode="w",status="replace") + write(coll_impactUnit,"(a1,1x,a14,1x,a16)") "#","impact","divergence" + end if + + do j=1,napx + if(part_hit_pos (j) == ie .and. part_hit_turn(j) == iturn) then + num_selhit = num_selhit + 1 + if(part_abs_pos(j) == 0 .and. part_abs_turn(j) == 0) then + num_surhit = num_surhit + 1 + else + num_selabs = num_selabs + 1 + end if + + if(part_impact(j) < -half) then + write(lerr,"(a,i0)") "COLL> ERROR Found invalid impact parameter ",part_impact(j) + write(outlun,*) "ERR> Found invalid impact parameter ",part_impact(j) + call prror + end if + + n_impact = n_impact + 1 + sum = sum + part_impact(j) + sqsum = sqsum + part_impact(j)**2 + + if(dowrite_impact) then + write(coll_impactUnit,"(1pe16.9,1x,1pe16.9)") part_impact(j), part_indiv(j) + end if + + else if(do_select .and. firstrun) then + ! If we want to select only partciles interacting at the specified + ! collimator then remove all other particles and reset the number + ! of the absorbed particles to the selected collimator. + part_select(j) = 0 + n_tot_absorbed = num_selabs + end if + end do + + if(n_impact > 0) then + average = sum/n_impact + if(sqsum/n_impact >= average**2) then + sigma = sqrt(sqsum/n_impact - average**2) + else + sigma = zero + end if + end if + + write(lout,"(a,i8)") "COLL> Selected collimator hits : ", num_selhit + write(lout,"(a,i8)") "COLL> Number of impacts : ", n_impact + write(lout,"(a,i8)") "COLL> Number of escaped protons : ", num_surhit + write(lout,"(a,f18.9)") "COLL> Average impact parameter [m] : ", average + write(lout,"(a,f18.9)") "COLL> Sigma impact parameter [m] : ", sigma + + if(dowrite_impact) then + call f_close(coll_impactUnit) + end if + +end subroutine coll_writeSelectedCollimator + +! ================================================================================================ ! +! Writing of tracks2.dat +! ================================================================================================ ! +subroutine coll_writeTracks2(iMode) + + use coll_db + use coll_common + use mod_common + use mod_common_main + use mod_common_track +#ifdef HDF5 + use hdf5_output + use hdf5_tracks2 +#endif + + integer, intent(in) :: iMode + + integer j + real(kind=fPrec) sigX2, sigY2, halfLen + real(kind=fPrec) xj, xpj, yj, ypj, sj, pj + real(kind=fPrec) xk, xpk, yk, ypk, sk + + sigX2 = tbetax(ie)*c_emitx0_collgap + sigY2 = tbetay(ie)*c_emity0_collgap + halfLen = half*cdb_cLength(icoll) + + if(iMode == 1) then + + sj = dcum(ie) - halfLen + sk = dcum(ie) + halfLen + + do j=1,napx + if( & + part_hit_pos(j) == ie .and. part_hit_turn(j) == iturn .and. & + part_abs_pos(j) == 0 .and. part_abs_turn(j) == 0 .and. & + nhit_stage(j) > 0 .and. xv1(j) < 99.0_fPrec .and. xv2(j) < 99.0_fPrec .and. ( & + (xv1(j)*c1m3)**2 / sigX2 >= sigsecut2 .or. & + (xv2(j)*c1m3)**2 / sigY2 >= sigsecut2 .or. & + (xv1(j)*c1m3)**2 / sigX2 + (xv2(j)*c1m3)**2 / sigY2 >= sigsecut3 & + ) & + ) then + + xpj = rcxp0(j)*c1e3 + torbxp(ie) + xj = rcx0(j)*c1e3 + torbx(ie) - halfLen*xpj + ypj = rcyp0(j)*c1e3 + torbyp(ie) + yj = rcy0(j)*c1e3 + torby(ie) - halfLen*ypj + xk = xv1(j) + halfLen*yv1(j) + xpk = yv1(j) + yk = xv2(j) + halfLen*yv2(j) + ypk = yv2(j) + pj = (ejv(j) - c_enom)/c_enom + +#ifdef HDF5 + if(h5_writeTracks2) then + call h5tr2_writeLine(partID(j),iturn,sj,xj,xpj,yj,ypj,pj,nhit_stage(j)) + call h5tr2_writeLine(partID(j),iturn,sk,xk,xpk,yk,ypk,pj,nhit_stage(j)) + else +#endif + write(coll_tracksUnit,"(i8,1x,i8,1x,f10.2,4(1x,e12.5),1x,e11.3,1x,i4)") & + partID(j),iturn,sj,xj,xpj,yj,ypj,pj,nhit_stage(j) + write(coll_tracksUnit,"(i8,1x,i8,1x,f10.2,4(1x,e12.5),1x,e11.3,1x,i4)") & + partID(j),iturn,sk,xk,xpk,yk,ypk,pj,nhit_stage(j) +#ifdef HDF5 end if - end if !if(part_abs_pos(j).eq.0 .and. part_abs_turn(j).eq.0) then - end do ! do j = 1, napx - end if !if(dowritetracks) then -!======================================================================= -end subroutine collimate_end_turn +#endif + end if + end do + + elseif(iMode == 2) then ! End of element record + + do j=1,napx + if( & + part_abs_pos(j) == 0 .and. part_abs_turn(j) == 0 .and. & + nhit_stage(j) > 0 .and. xv1(j) < 99.0_fPrec .and. xv2(j) < 99.0_fPrec .and. ( & + (xv1(j)*c1m3)**2 / sigX2 >= sigsecut2 .or. & + (xv2(j)*c1m3)**2 / sigY2 >= sigsecut2 .or. & + (xv1(j)*c1m3)**2 / sigX2 + (xv2(j)*c1m3)**2 / sigY2 >= sigsecut3 & + ) & + ) then + +#ifdef HDF5 + if(h5_writeTracks2) then + call h5tr2_writeLine(partID(j),iturn,dcum(ie),xv1(j),yv1(j),xv2(j),yv2(j),& + (ejv(j)-c_enom)/c_enom,nhit_stage(j)) + else +#endif + write(coll_tracksUnit,"(i8,1x,i8,1x,f10.2,4(1x,e12.5),1x,e11.3,1x,i4)") partID(j),iturn,& + dcum(ie),xv1(j),yv1(j),xv2(j),yv2(j),(ejv(j)-c_enom)/c_enom,nhit_stage(j) +#ifdef HDF5 + end if +#endif + end if + end do + + end if + +end subroutine coll_writeTracks2 + +! ================================================================================================ ! +! Additional Routines under Compiler Flags +! ================================================================================================ ! + +#ifdef G4COLLIMATION +subroutine coll_doCollimator_Geant4(c_aperture,c_rotation,c_length) + + use crcoall + use mod_common + use mod_common_main + use mod_common_track + use coll_db + use coll_common + use geant4 + use string_tools + use mathlib_bouncer +#ifdef ROOT + use root_output +#endif + + real(kind=fPrec), intent(in) :: c_aperture + real(kind=fPrec), intent(in) :: c_rotation + real(kind=fPrec), intent(in) :: c_length + + integer j + + integer :: g4_lostc + integer :: g4_npart + integer :: part_hit_flag = 0 + integer :: part_abs_flag = 0 + real(kind=fPrec) x_tmp,y_tmp,xp_tmp,yp_tmp + + ! ien0,ien1: ion energy entering/leaving the collimator + ! energy in MeV + real(kind=fPrec) :: ien0, ien1 + integer(kind=int16) :: nnuc0,nnuc1 + + !! Add the geant4 geometry + if(firstrun .and. iturn == 1) then + call g4_add_collimator(cdb_cName(icoll), cdb_cMaterial(icoll), c_length, c_aperture, c_rotation, torbx(ie), torby(ie)) + end if + +!! Here we do the real collimation +!! First set the correct collimator + call g4_set_collimator(cdb_cName(icoll)) + flush(lout) + +!! Loop over all our particles + g4_lostc = 0 + nnuc0 = 0 + ien0 = zero + nnuc1 = 0 + ien1 = zero + + if(g4_debug .eqv. .true.) then + write(lout,"(2a)") 'COLLIMATOR:', cdb_cName(icoll) + write(lout,"(12a)") chr_lpad('id',33), chr_lpad('pdgid',12), chr_lpad('mass',25), chr_lpad('x',25), chr_lpad('y',25), & + chr_lpad('xp',25), chr_lpad('yp',25), chr_lpad('p',25), chr_lpad('spin_x',25), chr_lpad('spin_y',25),& + chr_lpad('spin_z',25) + flush(lout) + end if + + do j = 1, napx +!!!! if(part_abs_pos(j).eq.0 .and. part_abs_turn(j).eq.0) then +!! Rotate particles in the frame of the collimator +!! There is more precision if we do it here rather +!! than in the g4 geometry + + if(g4_debug .eqv. .true.) then + write(lout,"(a,2(1X,I11),10(1X,E24.16))") 'g4 sending particle: ', j, pdgid(j), nucm(j), rcx(j), rcy(j), rcxp(j), & + rcyp(j), rcp(j), spin_x(j), spin_y(j), spin_z(j), sigmv(j) + end if + + x_tmp = rcx(j) + y_tmp = rcy(j) + xp_tmp = rcxp(j) + yp_tmp = rcyp(j) + rcx(j) = x_tmp *cos_mb(c_rotation) + sin_mb(c_rotation)*y_tmp + rcy(j) = y_tmp *cos_mb(c_rotation) - sin_mb(c_rotation)*x_tmp + rcxp(j) = xp_tmp*cos_mb(c_rotation) + sin_mb(c_rotation)*yp_tmp + rcyp(j) = yp_tmp*cos_mb(c_rotation) - sin_mb(c_rotation)*xp_tmp + +!! Add all particles + call g4_add_particle(rcx(j), rcy(j), rcxp(j), rcyp(j), rcp(j), pdgid(j), nzz(j), naa(j), nqq(j), nucm(j), & + sigmv(j), spin_x(j), spin_y(j), spin_z(j)) + +! Log input energy + nucleons as per the FLUKA coupling + nnuc0 = nnuc0 + naa(j) + ien0 = ien0 + rcp(j) * c1e3 + end do + +!! Call the geant4 collimation function +! call g4_collimate(rcx(j), rcy(j), rcxp(j), rcyp(j), rcp(j)) + call g4_collimate() + +!! Get the particle number back + call g4_get_particle_count(g4_npart) + +!! resize arrays + call expand_arrays(nele, g4_npart, nblz, nblo, nbb) + +!! Reset napx to the correct value + napx = g4_npart + + if(g4_debug .eqv. .true.) then + write(lout,"(12a)") chr_lpad('id',33), chr_lpad('pdgid',12), chr_lpad('mass',25), chr_lpad('x',25), chr_lpad('y',25), & + chr_lpad('xp',25), chr_lpad('yp',25), chr_lpad('p',25), chr_lpad('spin_x',25), chr_lpad('spin_y',25),& + chr_lpad('spin_z',25) + flush(lout) + end if + + do j = 1, napx +!! Get the particle back + information +!! Remember C arrays start at 0, fortran at 1 here. + call g4_collimate_return(j-1, rcx(j), rcy(j), rcxp(j), rcyp(j), rcp(j), pdgid(j), nucm(j), nzz(j), naa(j), nqq(j), & + sigmv(j), part_hit_flag, part_abs_flag, part_impact(j), part_indiv(j), part_linteract(j), spin_x(j), spin_y(j), spin_z(j)) + + partID(j) = j + pstop (j) = .false. + +!! Rotate back into the accelerator frame + x_tmp = rcx(j) + y_tmp = rcy(j) + xp_tmp = rcxp(j) + yp_tmp = rcyp(j) + rcx(j) = x_tmp *cos_mb(-one*c_rotation) + sin_mb(-one*c_rotation)*y_tmp + rcy(j) = y_tmp *cos_mb(-one*c_rotation) - sin_mb(-one*c_rotation)*x_tmp + rcxp(j) = xp_tmp*cos_mb(-one*c_rotation) + sin_mb(-one*c_rotation)*yp_tmp + rcyp(j) = yp_tmp*cos_mb(-one*c_rotation) - sin_mb(-one*c_rotation)*xp_tmp + +! This needs fixing - FIXME +! sigmv(j) = zero +! sigmv(j) = s - (g4_v0*g4_time) + part_impact(j) = 0 + part_indiv(j) = 0 + part_linteract(j) = 0 + +! Log output energy + nucleons as per the FLUKA coupling + nnuc1 = nnuc1 + naa(j) ! outcoming nucleons + ien1 = ien1 + rcp(j) * c1e3 ! outcoming energy + +! Fix hits +! if(part_hit_pos(j) .eq.ie .and. part_hit_turn(j).eq.iturn) + part_hit_pos(j) = ie + part_hit_turn(j) = iturn + part_abs_pos(j) = 0 + part_abs_turn(j) = 0 + +!! If a particle hit +! if(part_hit_flag.ne.0) then +! part_hit_pos(j) = ie +! part_hit_turn(j) = iturn +! end if +! +!! If a particle died (the checking if it is already dead is at the start of the loop) +!! Geant just has a general inelastic process that single diffraction is part of +!! Therefore we can not know if this interaction was SD or some other inelastic type +! if(part_abs_flag.ne.0) then +! if(dowrite_impact) then +!!! FLUKA_impacts.dat +! write(coll_flukImpUnit,'(i4,(1x,f6.3),(1x,f8.6),4(1x,e19.10),i2,2(1x,i7))') & +! & icoll,c_rotation,zero,zero,zero,zero,zero,part_abs_flag,flukaname(j),iturn +! end if +! +! part_abs_pos(j) = ie +! part_abs_turn(j) = iturn +! rcx(j) = 99.99e-3_fPrec +! rcy(j) = 99.99e-3_fPrec +! g4_lostc = g4_lostc + 1 +! end if + + if(g4_debug .eqv. .true.) then + write(lout,"(a,2(1X,I11),10(1X,E24.16))") 'g4 return particle: ', j, pdgid(j), nucm(j), rcx(j), rcy(j), rcxp(j), & + rcyp(j), rcp(j), spin_x(j), spin_y(j), spin_z(j), sigmv(j) + end if + + flush(lout) +!!!! end if !part_abs_pos(j) .ne. 0 .and. part_abs_turn(j) .ne. 0 + end do !do j = 1, napx + + call g4_collimation_clear() + + if((ien0-ien1) > one) then +#ifdef ROOT + if(root_flag .and. root_Collimation == 1) then + call root_EnergyDeposition(icoll, nnuc0-nnuc1,c1m3*(ien0-ien1)) + end if +#endif + write(unit208,"(2(i5,1x),e24.16)") icoll, (nnuc0-nnuc1), c1m3*(ien0-ien1) + flush(unit208) + end if + +end subroutine coll_doCollimator_Geant4 +#endif + +! ================================================================================================ ! +! Echo the simulation settings to lout +! ================================================================================================ ! +subroutine coll_echoSettings + + use parpro + use crcoall + use mod_common + use mod_common_track + use coll_db + use coll_dist + use coll_common + use mod_units + use string_tools + + integer i + + call f_requestUnit("colltrack.out", outlun) + call f_open(unit=outlun,file="colltrack.out",formatted=.true.,mode="w",status="replace") + + write(outlun,*) + write(outlun,*) + write(outlun,*) ' -------------------------------' + write(outlun,*) + write(outlun,*) ' Program C O L L T R A C K ' + write(outlun,*) + write(outlun,*) ' R. Assmann - AB/ABP' + write(outlun,*) ' C.Bracco - AB/ABP' + write(outlun,*) ' V. Previtali - AB/ABP' + write(outlun,*) ' S. Redaelli - AB/OP' + write(outlun,*) ' G. Robert-Demolaize - BNL' + write(outlun,*) ' A. Rossi - AB/ABP' + write(outlun,*) ' T. Weiler - IEKP' + write(outlun,*) + write(outlun,*) ' CERN 2001 - 2009' + write(outlun,*) + write(outlun,*) ' -------------------------------' + write(outlun,*) + write(outlun,*) + + write(lout,"(a)") "" + write(lout,"(a)") str_divLine + write(lout,"(a)") " INITIALISING COLLIMATION" + write(lout,"(a)") str_divLine + write(lout,"(a)") "" + write(lout,"(a,e15.8)") 'COLL> Info: Betax0 [m] = ', tbetax(1) + write(lout,"(a,e15.8)") 'COLL> Info: Betay0 [m] = ', tbetay(1) + write(lout,"(a,e15.8)") 'COLL> Info: Alphax0 = ', talphax(1) + write(lout,"(a,e15.8)") 'COLL> Info: Alphay0 = ', talphay(1) + write(lout,"(a,e15.8)") 'COLL> Info: Orbitx0 [mm] = ', torbx(1) + write(lout,"(a,e15.8)") 'COLL> Info: Orbitxp0 [mrad] = ', torbxp(1) + write(lout,"(a,e15.8)") 'COLL> Info: Orbity0 [mm] = ', torby(1) + write(lout,"(a,e15.8)") 'COLL> Info: Orbitpy0 [mrad] = ', torbyp(1) + write(lout,"(a,e15.8)") 'COLL> Info: Emitx0_dist [um] = ', emitnx0_dist*gammar + write(lout,"(a,e15.8)") 'COLL> Info: Emity0_dist [um] = ', emitny0_dist*gammar + write(lout,"(a,e15.8)") 'COLL> Info: Emitx0_collgap [um] = ', emitnx0_collgap*gammar + write(lout,"(a,e15.8)") 'COLL> Info: Emity0_collgap [um] = ', emitny0_collgap*gammar + write(lout,"(a,e15.8)") 'COLL> Info: E0 [MeV] = ', e0 + write(lout,"(a)") + + write(lout,"(a,i0)") 'COLL> Info: DIST_TYPES = ', do_thisdis + write(lout,"(a,e15.8)") 'COLL> Info: DIST_NEX = ', cdist_ampX + write(lout,"(a,e15.8)") 'COLL> Info: DIST_DEX = ', cdist_smearX + write(lout,"(a,e15.8)") 'COLL> Info: DIST_NEY = ', cdist_ampY + write(lout,"(a,e15.8)") 'COLL> Info: DIST_DEY = ', cdist_smearY + write(lout,"(a,a)") 'COLL> Info: DIST_FILE = ', trim(cdist_fileName) + write(lout,"(a,e15.8)") 'COLL> Info: DIST_EN_ERROR = ', cdist_spreadE + write(lout,"(a,e15.8)") 'COLL> Info: DIST_BUNCHLENGTH = ', cdist_bunchLen + write(lout,"(a,l1)") 'COLL> Info: DO_COLL = ', do_coll + write(lout,"(a,l1)") 'COLL> Info: DO_NSIG = ', cdb_doNSig + do i=1,cdb_nFam + write(lout,"(a,a19,a3,f13.6)") "COLL> Info: ",chr_rPad("NSIG_"//trim(chr_toUpper(cdb_famName(i))),19)," = ",cdb_famNSig(i) + end do + write(lout,"(a)") + write(lout,"(a)") 'COLL> INPUT PARAMETERS FOR THE SLICING:' + write(lout,"(a)") + write(lout,"(a,i0)") 'COLL> Info: N_SLICES = ', n_slices + write(lout,"(a,e15.8)") 'COLL> Info: SMIN_SLICES = ', smin_slices + write(lout,"(a,e15.8)") 'COLL> Info: SMAX_SLICES = ', smax_slices + write(lout,"(a,e15.8)") 'COLL> Info: RECENTER1 = ', recenter1 + write(lout,"(a,e15.8)") 'COLL> Info: RECENTER2 = ', recenter2 + write(lout,"(a)") + write(lout,"(a,e15.8)") 'COLL> Info: JAW_FIT(1,1) = ', jaw_fit(1,1) + write(lout,"(a,e15.8)") 'COLL> Info: JAW_FIT(1,2) = ', jaw_fit(1,2) + write(lout,"(a,e15.8)") 'COLL> Info: JAW_FIT(1,3) = ', jaw_fit(1,3) + write(lout,"(a,e15.8)") 'COLL> Info: JAW_FIT(1,4) = ', jaw_fit(1,4) + write(lout,"(a,e15.8)") 'COLL> Info: JAW_FIT(1,5) = ', jaw_fit(1,5) + write(lout,"(a,e15.8)") 'COLL> Info: JAW_FIT(1,6) = ', jaw_fit(1,6) + write(lout,"(a,e15.8)") 'COLL> Info: SCALING1 = ', jaw_ssf(1) + write(lout,"(a)") + write(lout,"(a,e15.8)") 'COLL> Info: JAW_FIT(2,1) = ', jaw_fit(2,1) + write(lout,"(a,e15.8)") 'COLL> Info: JAW_FIT(2,2) = ', jaw_fit(2,2) + write(lout,"(a,e15.8)") 'COLL> Info: JAW_FIT(2,3) = ', jaw_fit(2,3) + write(lout,"(a,e15.8)") 'COLL> Info: JAW_FIT(2,4) = ', jaw_fit(2,4) + write(lout,"(a,e15.8)") 'COLL> Info: JAW_FIT(2,5) = ', jaw_fit(2,5) + write(lout,"(a,e15.8)") 'COLL> Info: JAW_FIT(2,6) = ', jaw_fit(2,6) + write(lout,"(a,e15.8)") 'COLL> Info: SCALING2 = ', jaw_ssf(2) + write(lout,"(a)") + write(lout,"(a,e15.8)") 'COLL> Info: EMITXN0_DIST = ', emitnx0_dist + write(lout,"(a,e15.8)") 'COLL> Info: EMITYN0_DIST = ', emitny0_dist + write(lout,"(a,e15.8)") 'COLL> Info: EMITXN0_COLLGAP = ', emitnx0_collgap + write(lout,"(a,e15.8)") 'COLL> Info: EMITYN0_COLLGAP = ', emitny0_collgap + write(lout,"(a)") + write(lout,"(a,l1)") 'COLL> Info: DO_SELECT = ', do_select + write(lout,"(a,l1)") 'COLL> Info: DO_NOMINAL = ', do_nominal + write(lout,"(a,i0)") 'COLL> Info: RND_SEED = ', rnd_seed + write(lout,"(a,l1)") 'COLL> Info: DOWRITE_DIST = ', dowrite_dist + write(lout,"(a,a)") 'COLL> Info: NAME_SEL = ', name_sel + write(lout,"(a,l1)") 'COLL> Info: DO_ONESIDE = ', do_oneside + write(lout,"(a,l1)") 'COLL> Info: DOWRITE_IMPACT = ', dowrite_impact + write(lout,"(a,l1)") 'COLL> Info: DOWRITE_SECONDARY = ', dowrite_secondary + write(lout,"(a,l1)") 'COLL> Info: DOWRITE_AMPLITUDE = ', dowrite_amplitude + write(lout,"(a,l1)") 'COLL> Info: DOWRITE_EFFICIENCY = ', dowrite_efficiency + write(lout,"(a)") + write(lout,"(a,e15.8)") 'COLL> Info: XBEAT = ', xbeat + write(lout,"(a,e15.8)") 'COLL> Info: XBEATPHASE = ', xbeatphase + write(lout,"(a,e15.8)") 'COLL> Info: YBEAT = ', ybeat + write(lout,"(a,e15.8)") 'COLL> Info: YBEATPHASE = ', ybeatphase + write(lout,"(a)") + write(lout,"(a,e15.8)") 'COLL> Info: C_RMSTILT_PRIM = ', c_rmstilt_prim + write(lout,"(a,e15.8)") 'COLL> Info: C_RMSTILT_SEC = ', c_rmstilt_sec + write(lout,"(a,e15.8)") 'COLL> Info: C_SYSTILT_PRIM = ', c_systilt_prim + write(lout,"(a,e15.8)") 'COLL> Info: C_SYSTILT_SEC = ', c_systilt_sec + write(lout,"(a,e15.8)") 'COLL> Info: C_RMSOFFSET_PRIM = ', c_rmsoffset_prim + write(lout,"(a,e15.8)") 'COLL> Info: C_SYSOFFSET_PRIM = ', c_sysoffset_prim + write(lout,"(a,e15.8)") 'COLL> Info: C_RMSOFFSET_SEC = ', c_rmsoffset_sec + write(lout,"(a,e15.8)") 'COLL> Info: C_SYSOFFSET_SEC = ', c_sysoffset_sec + write(lout,"(a,i0)") 'COLL> Info: C_OFFSETTITLT_SEED = ', c_offsettilt_seed + write(lout,"(a,e15.8)") 'COLL> Info: C_RMSERROR_GAP = ', c_rmserror_gap + write(lout,"(a,l1)") 'COLL> Info: DO_MINGAP = ', do_mingap + write(lout,"(a)") + write(lout,"(a,l1)") 'COLL> Info: RADIAL = ', radial + write(lout,"(a,e15.8)") 'COLL> Info: NR = ', cdist_ampR + write(lout,"(a,e15.8)") 'COLL> Info: NDR = ', cdist_smearR + write(lout,"(a)") + write(lout,"(a,e15.8)") 'COLL: Info: DRIFTSX = ', driftsx + write(lout,"(a,e15.8)") 'COLL: Info: DRIFTSY = ', driftsy + write(lout,"(a,l1)") 'COLL: Info: SYSTILT_ANTISYMM = ', systilt_antisymm + write(lout,"(a)") + write(lout,"(a,i0)") 'COLL> Info: IPENCIL = ', ipencil + write(lout,"(a,e15.8)") 'COLL> Info: PENCIL_OFFSET = ', pencil_offset + write(lout,"(a,e15.8)") 'COLL> Info: PENCIL_RMSX = ', pencil_rmsx + write(lout,"(a,e15.8)") 'COLL> Info: PENCIL_RMSY = ', pencil_rmsy + write(lout,"(a,i0)") 'COLL> Info: PENCIL_DISTR = ', pencil_distr + write(lout,"(a)") + write(lout,"(a,a)") 'COLL> Info: COLL_DB = ', cdb_fileName + write(lout,"(a)") + write(lout,"(a,l1)") 'COLL> Info: dowrite_tracks = ', dowrite_tracks + write(lout,"(a)") + write(lout,"(a,e15.8)") 'COLL> Info: SIGSECUT2 = ', sigsecut2 + write(lout,"(a,e15.8)") 'COLL> Info: SIGSECUT3 = ', sigsecut3 + write(lout,"(a)") + write(lout,"(a,i0)") 'COLL> Info: NAPX = ', napx + write(lout,"(a,e15.8)") 'COLL> Info: Sigma_x0 = ', sqrt(tbetax(1)*c_emitx0_dist) + write(lout,"(a,e15.8)") 'COLL> Info: Sigma_y0 = ', sqrt(tbetay(1)*c_emity0_dist) + write(lout,"(a)") + +end subroutine coll_echoSettings end module collimation diff --git a/source/main_cr.f90 b/source/main_cr.f90 index fbb353ce5..ad211b707 100644 --- a/source/main_cr.f90 +++ b/source/main_cr.f90 @@ -40,7 +40,7 @@ program maincr use mod_fluc, only : fluc_randomReport, fluc_errAlign, fluc_errZFZ use postprocessing, only : postpr, writebin_header, writebin use read_write, only : writeFort12, readFort13, readFort33 - use collimation, only : do_coll, collimate_init, collimate_exit + use collimation, only : do_coll, coll_init, coll_exitCollimation use mod_ffield, only : ffield_mod_init,ffield_mod_end #ifdef FLUKA @@ -1180,7 +1180,7 @@ program maincr call dump_initialise if(ithick == 0 .and. do_coll) then ! Only if thin and collimation enabled - call collimate_init + call coll_init end if call time_timeStamp(time_afterInitialisation) @@ -1212,7 +1212,7 @@ program maincr if(ithick == 0 .and. do_coll) then ! Only if thin 6D and collimation enabled - call collimate_exit + call coll_exitCollimation endif ! trtime is now the tracking time, BUT we must add other time for C/R diff --git a/source/mainarrays.f90 b/source/mainarrays.f90 index 79f361f9c..d169fe8ad 100644 --- a/source/mainarrays.f90 +++ b/source/mainarrays.f90 @@ -29,7 +29,7 @@ subroutine allocate_arrays #ifdef FLUKA use mod_fluka, only : fluka_mod_expand_arrays #endif - use collimation, only : collimation_allocate_arrays + use collimation, only : collimation_expand_arrays use coll_db, only : cdb_expand_arrays implicit none @@ -49,6 +49,7 @@ subroutine allocate_arrays call wire_expand_arrays(nele,nblz) call scatter_expand_arrays(nele,npart) call aperture_expand_arrays(nele,npart) + call collimation_expand_arrays(npart,nblz) call elens_allocate_arrays call cheby_allocate_arrays @@ -57,7 +58,6 @@ subroutine allocate_arrays #ifdef CR call cr_expand_arrays(npart) #endif - call collimation_allocate_arrays call cdb_expand_arrays(nele) end subroutine allocate_arrays @@ -266,30 +266,7 @@ subroutine shuffleLostParticles ! Collimation if(do_coll) then - tnapx = napx - do j=napx,1,-1 - if(llostp(j) .eqv. .false.) cycle - - part_hit_pos(j:tnapx) = cshift(part_hit_pos(j:tnapx), 1) - part_hit_turn(j:tnapx) = cshift(part_hit_turn(j:tnapx), 1) - part_abs_pos(j:tnapx) = cshift(part_abs_pos(j:tnapx), 1) - part_abs_turn(j:tnapx) = cshift(part_abs_turn(j:tnapx), 1) - part_select(j:tnapx) = cshift(part_select(j:tnapx), 1) - part_impact(j:tnapx) = cshift(part_impact(j:tnapx), 1) - part_indiv(j:tnapx) = cshift(part_indiv(j:tnapx), 1) - part_linteract(j:tnapx) = cshift(part_linteract(j:tnapx), 1) - part_hit_before_pos(j:tnapx) = cshift(part_hit_before_pos(j:tnapx), 1) - part_hit_before_turn(j:tnapx) = cshift(part_hit_before_turn(j:tnapx), 1) - - nabs_type(j:tnapx) = cshift(nabs_type(j:tnapx), 1) - nhit_stage(j:tnapx) = cshift(nhit_stage(j:tnapx), 1) - - counted_r(j:tnapx,:) = cshift(counted_r(j:tnapx,:), 1, 1) - counted_x(j:tnapx,:) = cshift(counted_x(j:tnapx,:), 1, 1) - counted_y(j:tnapx,:) = cshift(counted_y(j:tnapx,:), 1, 1) - - tnapx = tnapx - 1 - end do + call coll_shuffleLostPart end if #ifdef FLUKA diff --git a/source/sixtrack.f90 b/source/sixtrack.f90 index 6fdb5059b..adb3b3041 100644 --- a/source/sixtrack.f90 +++ b/source/sixtrack.f90 @@ -723,7 +723,7 @@ subroutine daten elseif(closeBlock) then continue else - call collimate_parseInputLine(inLine,blockLine,inErr) + call coll_parseInputLine(inLine,blockLine,inErr) if(inErr) goto 9999 end if @@ -943,7 +943,7 @@ subroutine daten emity = sixin_emitNY*gammar if(do_coll) then - call collimate_postInput(gammar) + call coll_postInput(gammar) end if ! Check for incompatible flags diff --git a/source/track_thin.f90 b/source/track_thin.f90 index a195f8eb7..0fadaee2f 100644 --- a/source/track_thin.f90 +++ b/source/track_thin.f90 @@ -626,20 +626,19 @@ subroutine thin6d(nthinerr) if(nthinerr /= 0) return if(do_coll) then - call collimate_start_turn(n) + call coll_startTurn(n) end if !! This is the loop over each element: label 650 do 650 i=1,iu !Loop over elements - if(do_coll) then - ! This subroutine sets variable myix - call collimate_start_element(i) - endif - ! No if(ktrack(i).eq.1) - a BLOC - is needed in thin tracking, ! as no dependency on ix in this case. ix=ic(i)-nblo + + if(do_coll) then + call coll_startElement(i,ix) + end if meta_nPTurnEle = meta_nPTurnEle + napx ! Fringe Fields @@ -732,7 +731,7 @@ subroutine thin6d(nthinerr) ! Check if collimation is enabled, and call the collimation code as necessary if(do_coll .and. is_coll) then ! Collimator is in database, and we're doing collimation - call collimate_trackThin(stracki,.true.) + call coll_doCollimator(stracki) else ! Normal SixTrack drifts if(iexact) then ! EXACT DRIFT do j=1,napx @@ -750,7 +749,7 @@ subroutine thin6d(nthinerr) end if if(do_coll) then ! Not a collimator, but collimation still need to perform additional calculations - call collimate_trackThin(stracki,.false.) + call coll_computeStats end if end if @@ -1290,7 +1289,7 @@ subroutine thin6d(nthinerr) 640 continue ! end of the SELECT CASE over element type (dotrack) if(do_coll) then - call collimate_end_element + call coll_endElement end if #include "include/lostpart.f90" @@ -1304,7 +1303,7 @@ subroutine thin6d(nthinerr) 650 continue !END loop over structure elements if(do_coll) then - call collimate_end_turn + call coll_endTurn end if #ifdef ROOT if(root_flag .and. root_Collimation == 1) then @@ -1313,9 +1312,7 @@ subroutine thin6d(nthinerr) #endif if(nthinerr /= 0) return - if(do_coll) then - firstrun = .false. - else + if(do_coll .eqv. .false.) then if(ntwin /= 2) call trackDistance #ifndef FLUKA if(mod(n,nwr(4)) == 0) call trackPairReport(n) diff --git a/test/collimation_k2/efficiency.dat.canonical b/test/collimation_k2/efficiency.dat.canonical index afec821b6..0812d65ee 100644 --- a/test/collimation_k2/efficiency.dat.canonical +++ b/test/collimation_k2/efficiency.dat.canonical @@ -1,33 +1,33 @@ # rad_sigma frac_x frac_y frac_r eff_x eff_y eff_r n_abs - 0.5000000E+01 0.1801834E+01 0.0000000E+00 0.1801834E+01 0.1925800E+05 0.0000000E+00 0.1925800E+05 10688 - 0.5500000E+01 0.1801834E+01 0.0000000E+00 0.1801834E+01 0.1925800E+05 0.0000000E+00 0.1925800E+05 10688 - 0.6000000E+01 0.1801834E+01 0.0000000E+00 0.1801834E+01 0.1925800E+05 0.0000000E+00 0.1925800E+05 10688 - 0.6500000E+01 0.1801834E+01 0.0000000E+00 0.1801834E+01 0.1925800E+05 0.0000000E+00 0.1925800E+05 10688 - 0.7000000E+01 0.1801834E+01 0.0000000E+00 0.1801834E+01 0.1925800E+05 0.0000000E+00 0.1925800E+05 10688 - 0.7500000E+01 0.1801834E+01 0.0000000E+00 0.1801834E+01 0.1925800E+05 0.0000000E+00 0.1925800E+05 10688 - 0.8000000E+01 0.2095808E-01 0.0000000E+00 0.1622380E+00 0.2240000E+03 0.0000000E+00 0.1734000E+04 10688 - 0.8500000E+01 0.6455838E-02 0.0000000E+00 0.2039671E-01 0.6900000E+02 0.0000000E+00 0.2180000E+03 10688 - 0.9000000E+01 0.1497006E-02 0.0000000E+00 0.7952844E-02 0.1600000E+02 0.0000000E+00 0.8500000E+02 10688 - 0.9500000E+01 0.9356287E-04 0.0000000E+00 0.3555389E-02 0.1000000E+01 0.0000000E+00 0.3800000E+02 10688 - 0.1000000E+02 0.0000000E+00 0.0000000E+00 0.6549401E-03 0.0000000E+00 0.0000000E+00 0.7000000E+01 10688 - 0.1050000E+02 0.0000000E+00 0.0000000E+00 0.2806886E-03 0.0000000E+00 0.0000000E+00 0.3000000E+01 10688 - 0.1100000E+02 0.0000000E+00 0.0000000E+00 0.9356287E-04 0.0000000E+00 0.0000000E+00 0.1000000E+01 10688 - 0.1150000E+02 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 10688 - 0.1200000E+02 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 10688 - 0.1250000E+02 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 10688 - 0.1300000E+02 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 10688 - 0.1350000E+02 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 10688 - 0.1400000E+02 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 10688 - 0.1450000E+02 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 10688 - 0.1500000E+02 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 10688 - 0.1550000E+02 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 10688 - 0.1600000E+02 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 10688 - 0.1650000E+02 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 10688 - 0.1700000E+02 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 10688 - 0.1750000E+02 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 10688 - 0.1800000E+02 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 10688 - 0.1850000E+02 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 10688 - 0.1900000E+02 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 10688 - 0.1950000E+02 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 10688 - 0.2000000E+02 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 10688 - 0.2050000E+02 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 10688 + 0.5000000E+01 0.1801834E+01 0.2994012E-02 0.1801834E+01 0.1925800E+05 0.3200000E+02 0.1925800E+05 10688 + 0.5500000E+01 0.1801834E+01 0.1777695E-02 0.1801834E+01 0.1925800E+05 0.1900000E+02 0.1925800E+05 10688 + 0.6000000E+01 0.1801834E+01 0.8420659E-03 0.1801834E+01 0.1925800E+05 0.9000000E+01 0.1925800E+05 10688 + 0.6500000E+01 0.1801834E+01 0.2806886E-03 0.1801834E+01 0.1925800E+05 0.3000000E+01 0.1925800E+05 10688 + 0.7000000E+01 0.1801834E+01 0.9356287E-04 0.1801834E+01 0.1925800E+05 0.1000000E+01 0.1925800E+05 10688 + 0.7500000E+01 0.1801834E+01 0.0000000E+00 0.1801834E+01 0.1925800E+05 0.0000000E+00 0.1925800E+05 10688 + 0.8000000E+01 0.2095808E-01 0.0000000E+00 0.1622380E+00 0.2240000E+03 0.0000000E+00 0.1734000E+04 10688 + 0.8500000E+01 0.6455838E-02 0.0000000E+00 0.2039671E-01 0.6900000E+02 0.0000000E+00 0.2180000E+03 10688 + 0.9000000E+01 0.1497006E-02 0.0000000E+00 0.7952844E-02 0.1600000E+02 0.0000000E+00 0.8500000E+02 10688 + 0.9500000E+01 0.9356287E-04 0.0000000E+00 0.3555389E-02 0.1000000E+01 0.0000000E+00 0.3800000E+02 10688 + 0.1000000E+02 0.0000000E+00 0.0000000E+00 0.6549401E-03 0.0000000E+00 0.0000000E+00 0.7000000E+01 10688 + 0.1050000E+02 0.0000000E+00 0.0000000E+00 0.2806886E-03 0.0000000E+00 0.0000000E+00 0.3000000E+01 10688 + 0.1100000E+02 0.0000000E+00 0.0000000E+00 0.9356287E-04 0.0000000E+00 0.0000000E+00 0.1000000E+01 10688 + 0.1150000E+02 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 10688 + 0.1200000E+02 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 10688 + 0.1250000E+02 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 10688 + 0.1300000E+02 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 10688 + 0.1350000E+02 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 10688 + 0.1400000E+02 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 10688 + 0.1450000E+02 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 10688 + 0.1500000E+02 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 10688 + 0.1550000E+02 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 10688 + 0.1600000E+02 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 10688 + 0.1650000E+02 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 10688 + 0.1700000E+02 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 10688 + 0.1750000E+02 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 10688 + 0.1800000E+02 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 10688 + 0.1850000E+02 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 10688 + 0.1900000E+02 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 10688 + 0.1950000E+02 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 10688 + 0.2000000E+02 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 10688 + 0.2050000E+02 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 0.0000000E+00 10688 diff --git a/test/collimation_k2/efficiency_dpop.dat.canonical b/test/collimation_k2/efficiency_dpop.dat.canonical index edb3e5d05..4838645e6 100644 --- a/test/collimation_k2/efficiency_dpop.dat.canonical +++ b/test/collimation_k2/efficiency_dpop.dat.canonical @@ -1,12 +1,12 @@ # dp/p n_dpop/tot_nabs n_dpop tot_nabs npart - 0.1000000E-03 0.1122754E-02 0.1200000E+02 10688 0 - 0.4000000E-03 0.9356287E-04 0.1000000E+01 10688 0 + 0.1000000E-03 0.1122754E-02 0.1200000E+02 10688 259016 + 0.4000000E-03 0.9356287E-04 0.1000000E+01 10688 11 0.8000000E-03 0.9356287E-04 0.1000000E+01 10688 0 0.1200000E-02 0.9356287E-04 0.1000000E+01 10688 0 0.1600000E-02 0.9356287E-04 0.1000000E+01 10688 0 0.2000000E-02 0.9356287E-04 0.1000000E+01 10688 0 0.2400000E-02 0.9356287E-04 0.1000000E+01 10688 0 - 0.2800000E-02 0.0000000E+00 0.0000000E+00 10688 0 + 0.2800000E-02 0.0000000E+00 0.0000000E+00 10688 1 0.3200000E-02 0.0000000E+00 0.0000000E+00 10688 0 0.3600000E-02 0.0000000E+00 0.0000000E+00 10688 0 0.4000000E-02 0.0000000E+00 0.0000000E+00 10688 0 diff --git a/test/collimation_k2/extra_checks.txt b/test/collimation_k2/extra_checks.txt index 0c75d5e7c..33db9da7d 100644 --- a/test/collimation_k2/extra_checks.txt +++ b/test/collimation_k2/extra_checks.txt @@ -4,4 +4,6 @@ coll_summary.dat efficiency.dat efficiency_2d.dat efficiency_dpop.dat +sigmasettings.out hash.md5 +impact.dat diff --git a/test/collimation_k2/fort.3 b/test/collimation_k2/fort.3 index 27b98e752..c1b3c5338 100644 --- a/test/collimation_k2/fort.3 +++ b/test/collimation_k2/fort.3 @@ -82,7 +82,7 @@ COLLIMATION------------------------------------------------------------- -1.3899e-6 -9.345e-5 5.05324e-3 -1.6595e-2 2.15955e-2 -9.96261e-3 1.0 -1.3899e-6 -9.345e-5 5.05324e-3 -1.6595e-2 2.15955e-2 -9.96261e-3 1.0 2.2 2.2 2.2 2.2 - .false. .false. 1234 .true. tcp.c6l7.b1 .false. .true. .true. .true. + .false. .false. 1234 .true. tcsg.b5l2.b1 .false. .true. .true. .true. .true. 0 0 0 0 0 0 0 0 0 0 0 0 0 0 .false. .false. 6.003 .0015 @@ -93,3 +93,12 @@ COLLIMATION------------------------------------------------------------- NEXT ENDE +! Mem Usage - SixTrack 5.4 +! (COLL line 10, option 9 and 10) + +! AMPLITUDE | EFFICENCY | MEMORY (HWM) +! ====================================== +! .false. | .false. | 72.871 MB +! .true. | .false...| 75.402 MB +! .false. | .true. | 156.875 MB +! .true. | .true. | 159.496 MB diff --git a/test/collimation_k2/hash.md5.canonical b/test/collimation_k2/hash.md5.canonical index 964361b80..1ca0ae741 100644 --- a/test/collimation_k2/hash.md5.canonical +++ b/test/collimation_k2/hash.md5.canonical @@ -1,7 +1,7 @@ 6f94772b973d8ddfaa56d6a830855ec2 final_state.dat 73e3dda9860f1dd1fa2035bec74954d7 all_absorptions.dat 88b52366c0edb99dd38d7f930d9d4cab all_impacts.dat -3068264839ad57b110d85b9368656e66 amplitude.dat +09297dda25c6f0880a87d52e8bb672ba amplitude.dat af71c221fd52b452f86f5bef7baa8fba Coll_Scatter.dat 7508d9723c7594c5e18d32a9f5da1162 FLUKA_impacts.dat e52d63b2ac7b388285ae1dac386e45d0 FLUKA_impacts_all.dat diff --git a/test/collimation_k2/impact.dat.canonical b/test/collimation_k2/impact.dat.canonical new file mode 100644 index 000000000..3e210f39c --- /dev/null +++ b/test/collimation_k2/impact.dat.canonical @@ -0,0 +1,32 @@ +# impact divergence + 3.648968656E-03 1.820696016E-05 + 1.352352867E-03 8.722405120E-06 + 1.826162931E-04 5.740119913E-06 + 8.155112774E-04 1.323425992E-05 + 1.402600886E-03 1.330178975E-05 + 6.005762310E-04 5.207693044E-06 + 3.646095843E-03 1.973240248E-05 + 8.262129124E-04 1.228094816E-05 + 2.474299815E-05 3.399656933E-06 + 2.740084929E-03 1.113793719E-05 + 1.080963577E-03 8.642480856E-06 + 3.623788814E-03 1.243708705E-05 + 2.314379898E-04 8.787763788E-06 + 4.932919233E-05 8.317211710E-06 + 1.527795681E-03 1.491463550E-05 + 1.822655079E-03 1.026307857E-05 + 2.933212871E-04 5.336360695E-06 + 6.252282987E-04 1.114742314E-05 + 1.201019484E-02 5.865395860E-05 + 2.724161826E-03 1.324992808E-05 + 2.413629395E-03 1.394379656E-05 + 4.735032658E-04 6.330974240E-06 + 4.832933430E-03 2.433806228E-05 + 1.356285709E-03 9.043074269E-06 + 5.801395794E-04 6.217898886E-06 + 2.994393926E-06 7.468846374E-06 + 5.214499168E-03 2.760028249E-05 + 3.302296104E-04 8.045081805E-06 + 1.272538453E-03 8.683359415E-06 + 3.226131565E-04 4.690193131E-06 + 1.700280332E-03 9.736517013E-06 diff --git a/test/collimation_k2/sigmasettings.out.canonical b/test/collimation_k2/sigmasettings.out.canonical new file mode 100644 index 000000000..9c2ed579f --- /dev/null +++ b/test/collimation_k2/sigmasettings.out.canonical @@ -0,0 +1,48 @@ +# collimator gap_h1 gap_h2 gap_h3 gap_h4 sig_offset coll_offset nsig gap_rms_error beta_x beta_y orb_x orb_y +tcp.d6l2.b1 7.570000 7.570000 7.570000 7.570000 0.000000 0.000000 7.570000 0.000000000E+00 7986.554020 3890.189147 0.000000 0.000000 +tcp.c6l2.b1 7.570000 7.570000 7.570000 7.570000 0.000000 0.000000 7.570000 0.000000000E+00 7568.047895 4113.982229 0.000000 0.000000 +tcp.b6l2.b1 7.570000 7.570000 7.570000 7.570000 0.000000 0.000000 7.570000 0.000000000E+00 7163.376596 4349.033820 0.000000 0.000000 +tcsg.a6l2.b1 8.830000 8.830000 8.830000 8.830000 0.000000 0.000000 8.830000 0.000000000E+00 1978.020838 11403.757234 0.000000 0.000000 +tcsg.b5l2.b1 8.830000 8.830000 8.830000 8.830000 0.000000 0.000000 8.830000 0.000000000E+00 8078.986814 8257.737579 0.000000 0.000000 +tcsg.a5l2.b1 8.830000 8.830000 8.830000 8.830000 0.000000 0.000000 8.830000 0.000000000E+00 9384.648054 7233.564808 0.000000 0.000000 +tcsg.d4l2.b1 8.830000 8.830000 8.830000 8.830000 0.000000 0.000000 8.830000 0.000000000E+00 16698.844363 3420.282451 0.000000 0.000000 +tcsg.b4l2.b1 8.830000 8.830000 8.830000 8.830000 0.000000 0.000000 8.830000 0.000000000E+00 6952.005061 6581.270698 0.000000 0.000000 +tcsg.a4l2.b1 8.830000 8.830000 8.830000 8.830000 0.000000 0.000000 8.830000 0.000000000E+00 6399.855700 7098.231028 0.000000 0.000000 +tcsg.a4r2.b1 8.830000 8.830000 8.830000 8.830000 0.000000 0.000000 8.830000 0.000000000E+00 5882.545856 7646.441920 0.000000 0.000000 +tcsg.b5r2.b1 8.830000 8.830000 8.830000 8.830000 0.000000 0.000000 8.830000 0.000000000E+00 6153.143962 13280.849638 0.000000 0.000000 +tcsg.d5r2.b1 8.830000 8.830000 8.830000 8.830000 0.000000 0.000000 8.830000 0.000000000E+00 10777.024010 7853.869018 0.000000 0.000000 +tcsg.e5r2.b1 8.830000 8.830000 8.830000 8.830000 0.000000 0.000000 8.830000 0.000000000E+00 12158.757729 6738.190450 0.000000 0.000000 +tcsg.6r2.b1 8.830000 8.830000 8.830000 8.830000 0.000000 0.000000 8.830000 0.000000000E+00 16715.787557 2367.566864 0.000000 0.000000 +tcla.a6r2.b1 12.610000 12.610000 12.610000 12.610000 0.000000 0.000000 12.610000 0.000000000E+00 14786.205038 2411.207661 0.000000 0.000000 +tcla.b6r2.b1 12.610000 12.610000 12.610000 12.610000 0.000000 0.000000 12.610000 0.000000000E+00 7929.168004 3838.976485 0.000000 0.000000 +tcla.c6r2.b1 12.610000 12.610000 12.610000 12.610000 0.000000 0.000000 12.610000 0.000000000E+00 3407.772735 7631.215209 0.000000 0.000000 +tcla.d6r2.b1 12.610000 12.610000 12.610000 12.610000 0.000000 0.000000 12.610000 0.000000000E+00 3230.751287 7933.685487 0.000000 0.000000 +tcla.a7r2.b1 12.610000 12.610000 12.610000 12.610000 0.000000 0.000000 12.610000 0.000000000E+00 3251.998827 7271.954820 0.000000 0.000000 +tcth.4la.h1 10.470000 10.470000 10.470000 10.470000 0.000000 0.000000 10.470000 0.000000000E+00 146657.526959 242598.392132 0.000000 0.000000 +tctva.4la.h1 10.470000 10.470000 10.470000 10.470000 0.000000 0.000000 10.470000 0.000000000E+00 147869.909937 246718.658394 0.000000 0.000000 +tcth.4lg.h1 10.470000 10.470000 10.470000 10.470000 0.000000 0.000000 10.470000 0.000000000E+00 146657.525551 242598.391841 0.000000 0.000000 +tctva.4lg.h1 10.470000 10.470000 10.470000 10.470000 0.000000 0.000000 10.470000 0.000000000E+00 147869.908519 246718.658101 0.000000 0.000000 +tcp.6l3.b1 18.060000 18.060000 18.060000 18.060000 0.000000 0.000000 18.060000 0.000000000E+00 3028.686595 3273.571336 0.000000 0.000000 +tcsg.5l3.b1 21.670000 21.670000 21.670000 21.670000 0.000000 0.000000 21.670000 0.000000000E+00 1251.284048 6807.675170 0.000000 0.000000 +tcsg.4r3.b1 21.670000 21.670000 21.670000 21.670000 0.000000 0.000000 21.670000 0.000000000E+00 596.565816 9047.184677 0.000000 0.000000 +tcsg.a5r3.b1 21.670000 21.670000 21.670000 21.670000 0.000000 0.000000 21.670000 0.000000000E+00 808.573530 7899.259497 0.000000 0.000000 +tcsg.b5r3.b1 21.670000 21.670000 21.670000 21.670000 0.000000 0.000000 21.670000 0.000000000E+00 1025.734336 7179.253012 0.000000 0.000000 +tcla.a5r3.b1 24.080000 24.080000 24.080000 24.080000 0.000000 0.000000 24.080000 0.000000000E+00 3221.348088 4046.952321 0.000000 0.000000 +tcla.b5r3.b1 24.080000 24.080000 24.080000 24.080000 0.000000 0.000000 24.080000 0.000000000E+00 3427.552847 3878.905533 0.000000 0.000000 +tcla.6r3.b1 24.080000 24.080000 24.080000 24.080000 0.000000 0.000000 24.080000 0.000000000E+00 2994.970814 3822.872838 0.000000 0.000000 +tcla.7r3.b1 24.080000 24.080000 24.080000 24.080000 0.000000 0.000000 24.080000 0.000000000E+00 1525.487945 2058.321213 0.000000 0.000000 +tcld.8rj.h1 35.140000 35.140000 35.140000 35.140000 0.000000 0.000000 35.140000 0.000000000E+00 249.860462 3343.978913 0.000000 0.000000 +tcld.10rj.h1 35.140000 35.140000 35.140000 35.140000 0.000000 0.000000 35.140000 0.000000000E+00 610.595304 3381.799293 0.000000 0.000000 +tcld.8rf.h1 35.140000 35.140000 35.140000 35.140000 0.000000 0.000000 35.140000 0.000000000E+00 2622.197467 1839.435939 0.000000 0.000000 +tcld.10rf.h1 35.140000 35.140000 35.140000 35.140000 0.000000 0.000000 35.140000 0.000000000E+00 3132.972026 1404.383778 0.000000 0.000000 +tcld.8ra.h1 35.140000 35.140000 35.140000 35.140000 0.000000 0.000000 35.140000 0.000000000E+00 307.796873 4288.476223 0.000000 0.000000 +tcld.10ra.h1 35.140000 35.140000 35.140000 35.140000 0.000000 0.000000 35.140000 0.000000000E+00 773.920542 3261.572953 0.000000 0.000000 +tcld.8rg.h1 35.140000 35.140000 35.140000 35.140000 0.000000 0.000000 35.140000 0.000000000E+00 307.796881 4288.476385 0.000000 0.000000 +tcld.10rg.h1 35.140000 35.140000 35.140000 35.140000 0.000000 0.000000 35.140000 0.000000000E+00 773.920522 3261.572873 0.000000 0.000000 + +# SUMMARY +# MinGap Collimator: 'tcp.b6l2.b1' +# MinGap Coll ID: 3 +# Min Gap Sigma: 7.570000 +# Pencil Initial: 0 +# Seed before reinit: 1234 diff --git a/test/collimation_tracks2/hash.md5.canonical b/test/collimation_tracks2/hash.md5.canonical index dffc6686a..bb338d610 100644 --- a/test/collimation_tracks2/hash.md5.canonical +++ b/test/collimation_tracks2/hash.md5.canonical @@ -1 +1 @@ -0e634208ffa8e8decd6457a3c39df97a tracks2.dat +2422632b1510e2984ec07f367db1d15a tracks2.dat diff --git a/test/collimation_tracks2/sigmasettings.out.canonical b/test/collimation_tracks2/sigmasettings.out.canonical index dbaafd193..9c2ed579f 100644 --- a/test/collimation_tracks2/sigmasettings.out.canonical +++ b/test/collimation_tracks2/sigmasettings.out.canonical @@ -1,43 +1,48 @@ - tcld.8ra.h1 35.140000000000001 35.140000000000001 35.140000000000001 35.140000000000001 0.0000000000000000 0.0000000000000000 35.140000000000001 -0.0000000000000000 - tcld.10ra.h1 35.140000000000001 35.140000000000001 35.140000000000001 35.140000000000001 0.0000000000000000 0.0000000000000000 35.140000000000001 -0.0000000000000000 - tcp.6l3.b1 18.059999999999999 18.059999999999999 18.059999999999999 18.059999999999999 0.0000000000000000 0.0000000000000000 18.059999999999999 0.0000000000000000 - tcsg.5l3.b1 21.670000000000002 21.670000000000002 21.670000000000002 21.670000000000002 0.0000000000000000 0.0000000000000000 21.670000000000002 0.0000000000000000 - tcsg.4r3.b1 21.670000000000002 21.670000000000002 21.670000000000002 21.670000000000002 0.0000000000000000 0.0000000000000000 21.670000000000002 0.0000000000000000 - tcsg.a5r3.b1 21.670000000000002 21.670000000000002 21.670000000000002 21.670000000000002 0.0000000000000000 0.0000000000000000 21.670000000000002 -0.0000000000000000 - tcsg.b5r3.b1 21.670000000000002 21.670000000000002 21.670000000000002 21.670000000000002 0.0000000000000000 0.0000000000000000 21.670000000000002 0.0000000000000000 - tcla.a5r3.b1 24.079999999999998 24.079999999999998 24.079999999999998 24.079999999999998 0.0000000000000000 0.0000000000000000 24.079999999999998 -0.0000000000000000 - tcla.b5r3.b1 24.079999999999998 24.079999999999998 24.079999999999998 24.079999999999998 0.0000000000000000 0.0000000000000000 24.079999999999998 -0.0000000000000000 - tcla.6r3.b1 24.079999999999998 24.079999999999998 24.079999999999998 24.079999999999998 0.0000000000000000 0.0000000000000000 24.079999999999998 0.0000000000000000 - tcla.7r3.b1 24.079999999999998 24.079999999999998 24.079999999999998 24.079999999999998 0.0000000000000000 0.0000000000000000 24.079999999999998 0.0000000000000000 - tcld.8rf.h1 35.140000000000001 35.140000000000001 35.140000000000001 35.140000000000001 0.0000000000000000 0.0000000000000000 35.140000000000001 -0.0000000000000000 - tcld.10rf.h1 35.140000000000001 35.140000000000001 35.140000000000001 35.140000000000001 0.0000000000000000 0.0000000000000000 35.140000000000001 -0.0000000000000000 - tcth.4lg.h1 10.470000000000001 10.470000000000001 10.470000000000001 10.470000000000001 0.0000000000000000 0.0000000000000000 10.470000000000001 0.0000000000000000 - tctva.4lg.h1 10.470000000000001 10.470000000000001 10.470000000000001 10.470000000000001 0.0000000000000000 0.0000000000000000 10.470000000000001 0.0000000000000000 - tcld.8rg.h1 35.140000000000001 35.140000000000001 35.140000000000001 35.140000000000001 0.0000000000000000 0.0000000000000000 35.140000000000001 0.0000000000000000 - tcld.10rg.h1 35.140000000000001 35.140000000000001 35.140000000000001 35.140000000000001 0.0000000000000000 0.0000000000000000 35.140000000000001 -0.0000000000000000 - tcp.d6l2.b1 7.5700000000000003 7.5700000000000003 7.5700000000000003 7.5700000000000003 0.0000000000000000 0.0000000000000000 7.5700000000000003 0.0000000000000000 - tcp.c6l2.b1 7.5700000000000003 7.5700000000000003 7.5700000000000003 7.5700000000000003 0.0000000000000000 0.0000000000000000 7.5700000000000003 0.0000000000000000 - tcp.b6l2.b1 7.5700000000000003 7.5700000000000003 7.5700000000000003 7.5700000000000003 0.0000000000000000 0.0000000000000000 7.5700000000000003 0.0000000000000000 - tcsg.a6l2.b1 8.8300000000000001 8.8300000000000001 8.8300000000000001 8.8300000000000001 0.0000000000000000 0.0000000000000000 8.8300000000000001 -0.0000000000000000 - tcsg.b5l2.b1 8.8300000000000001 8.8300000000000001 8.8300000000000001 8.8300000000000001 0.0000000000000000 0.0000000000000000 8.8300000000000001 -0.0000000000000000 - tcsg.a5l2.b1 8.8300000000000001 8.8300000000000001 8.8300000000000001 8.8300000000000001 0.0000000000000000 0.0000000000000000 8.8300000000000001 0.0000000000000000 - tcsg.d4l2.b1 8.8300000000000001 8.8300000000000001 8.8300000000000001 8.8300000000000001 0.0000000000000000 0.0000000000000000 8.8300000000000001 -0.0000000000000000 - tcsg.b4l2.b1 8.8300000000000001 8.8300000000000001 8.8300000000000001 8.8300000000000001 0.0000000000000000 0.0000000000000000 8.8300000000000001 0.0000000000000000 - tcsg.a4l2.b1 8.8300000000000001 8.8300000000000001 8.8300000000000001 8.8300000000000001 0.0000000000000000 0.0000000000000000 8.8300000000000001 -0.0000000000000000 - tcsg.a4r2.b1 8.8300000000000001 8.8300000000000001 8.8300000000000001 8.8300000000000001 0.0000000000000000 0.0000000000000000 8.8300000000000001 0.0000000000000000 - tcsg.b5r2.b1 8.8300000000000001 8.8300000000000001 8.8300000000000001 8.8300000000000001 0.0000000000000000 0.0000000000000000 8.8300000000000001 0.0000000000000000 - tcsg.d5r2.b1 8.8300000000000001 8.8300000000000001 8.8300000000000001 8.8300000000000001 0.0000000000000000 0.0000000000000000 8.8300000000000001 0.0000000000000000 - tcsg.e5r2.b1 8.8300000000000001 8.8300000000000001 8.8300000000000001 8.8300000000000001 0.0000000000000000 0.0000000000000000 8.8300000000000001 -0.0000000000000000 - tcsg.6r2.b1 8.8300000000000001 8.8300000000000001 8.8300000000000001 8.8300000000000001 0.0000000000000000 0.0000000000000000 8.8300000000000001 -0.0000000000000000 - tcla.a6r2.b1 12.609999999999999 12.609999999999999 12.609999999999999 12.609999999999999 0.0000000000000000 0.0000000000000000 12.609999999999999 0.0000000000000000 - tcla.b6r2.b1 12.609999999999999 12.609999999999999 12.609999999999999 12.609999999999999 0.0000000000000000 0.0000000000000000 12.609999999999999 -0.0000000000000000 - tcla.c6r2.b1 12.609999999999999 12.609999999999999 12.609999999999999 12.609999999999999 0.0000000000000000 0.0000000000000000 12.609999999999999 0.0000000000000000 - tcla.d6r2.b1 12.609999999999999 12.609999999999999 12.609999999999999 12.609999999999999 0.0000000000000000 0.0000000000000000 12.609999999999999 -0.0000000000000000 - tcla.a7r2.b1 12.609999999999999 12.609999999999999 12.609999999999999 12.609999999999999 0.0000000000000000 0.0000000000000000 12.609999999999999 -0.0000000000000000 - tcld.8rj.h1 35.140000000000001 35.140000000000001 35.140000000000001 35.140000000000001 0.0000000000000000 0.0000000000000000 35.140000000000001 -0.0000000000000000 - tcld.10rj.h1 35.140000000000001 35.140000000000001 35.140000000000001 35.140000000000001 0.0000000000000000 0.0000000000000000 35.140000000000001 -0.0000000000000000 - tcth.4la.h1 10.470000000000001 10.470000000000001 10.470000000000001 10.470000000000001 0.0000000000000000 0.0000000000000000 10.470000000000001 -0.0000000000000000 - tctva.4la.h1 10.470000000000001 10.470000000000001 10.470000000000001 10.470000000000001 0.0000000000000000 0.0000000000000000 10.470000000000001 0.0000000000000000 - 3 tcp.b6l2.b1 7.5700000000000003 - INFO> IPENCIL new (if do_mingap) 0 - INFO> rnd_seed is (before reinit) 1234 +# collimator gap_h1 gap_h2 gap_h3 gap_h4 sig_offset coll_offset nsig gap_rms_error beta_x beta_y orb_x orb_y +tcp.d6l2.b1 7.570000 7.570000 7.570000 7.570000 0.000000 0.000000 7.570000 0.000000000E+00 7986.554020 3890.189147 0.000000 0.000000 +tcp.c6l2.b1 7.570000 7.570000 7.570000 7.570000 0.000000 0.000000 7.570000 0.000000000E+00 7568.047895 4113.982229 0.000000 0.000000 +tcp.b6l2.b1 7.570000 7.570000 7.570000 7.570000 0.000000 0.000000 7.570000 0.000000000E+00 7163.376596 4349.033820 0.000000 0.000000 +tcsg.a6l2.b1 8.830000 8.830000 8.830000 8.830000 0.000000 0.000000 8.830000 0.000000000E+00 1978.020838 11403.757234 0.000000 0.000000 +tcsg.b5l2.b1 8.830000 8.830000 8.830000 8.830000 0.000000 0.000000 8.830000 0.000000000E+00 8078.986814 8257.737579 0.000000 0.000000 +tcsg.a5l2.b1 8.830000 8.830000 8.830000 8.830000 0.000000 0.000000 8.830000 0.000000000E+00 9384.648054 7233.564808 0.000000 0.000000 +tcsg.d4l2.b1 8.830000 8.830000 8.830000 8.830000 0.000000 0.000000 8.830000 0.000000000E+00 16698.844363 3420.282451 0.000000 0.000000 +tcsg.b4l2.b1 8.830000 8.830000 8.830000 8.830000 0.000000 0.000000 8.830000 0.000000000E+00 6952.005061 6581.270698 0.000000 0.000000 +tcsg.a4l2.b1 8.830000 8.830000 8.830000 8.830000 0.000000 0.000000 8.830000 0.000000000E+00 6399.855700 7098.231028 0.000000 0.000000 +tcsg.a4r2.b1 8.830000 8.830000 8.830000 8.830000 0.000000 0.000000 8.830000 0.000000000E+00 5882.545856 7646.441920 0.000000 0.000000 +tcsg.b5r2.b1 8.830000 8.830000 8.830000 8.830000 0.000000 0.000000 8.830000 0.000000000E+00 6153.143962 13280.849638 0.000000 0.000000 +tcsg.d5r2.b1 8.830000 8.830000 8.830000 8.830000 0.000000 0.000000 8.830000 0.000000000E+00 10777.024010 7853.869018 0.000000 0.000000 +tcsg.e5r2.b1 8.830000 8.830000 8.830000 8.830000 0.000000 0.000000 8.830000 0.000000000E+00 12158.757729 6738.190450 0.000000 0.000000 +tcsg.6r2.b1 8.830000 8.830000 8.830000 8.830000 0.000000 0.000000 8.830000 0.000000000E+00 16715.787557 2367.566864 0.000000 0.000000 +tcla.a6r2.b1 12.610000 12.610000 12.610000 12.610000 0.000000 0.000000 12.610000 0.000000000E+00 14786.205038 2411.207661 0.000000 0.000000 +tcla.b6r2.b1 12.610000 12.610000 12.610000 12.610000 0.000000 0.000000 12.610000 0.000000000E+00 7929.168004 3838.976485 0.000000 0.000000 +tcla.c6r2.b1 12.610000 12.610000 12.610000 12.610000 0.000000 0.000000 12.610000 0.000000000E+00 3407.772735 7631.215209 0.000000 0.000000 +tcla.d6r2.b1 12.610000 12.610000 12.610000 12.610000 0.000000 0.000000 12.610000 0.000000000E+00 3230.751287 7933.685487 0.000000 0.000000 +tcla.a7r2.b1 12.610000 12.610000 12.610000 12.610000 0.000000 0.000000 12.610000 0.000000000E+00 3251.998827 7271.954820 0.000000 0.000000 +tcth.4la.h1 10.470000 10.470000 10.470000 10.470000 0.000000 0.000000 10.470000 0.000000000E+00 146657.526959 242598.392132 0.000000 0.000000 +tctva.4la.h1 10.470000 10.470000 10.470000 10.470000 0.000000 0.000000 10.470000 0.000000000E+00 147869.909937 246718.658394 0.000000 0.000000 +tcth.4lg.h1 10.470000 10.470000 10.470000 10.470000 0.000000 0.000000 10.470000 0.000000000E+00 146657.525551 242598.391841 0.000000 0.000000 +tctva.4lg.h1 10.470000 10.470000 10.470000 10.470000 0.000000 0.000000 10.470000 0.000000000E+00 147869.908519 246718.658101 0.000000 0.000000 +tcp.6l3.b1 18.060000 18.060000 18.060000 18.060000 0.000000 0.000000 18.060000 0.000000000E+00 3028.686595 3273.571336 0.000000 0.000000 +tcsg.5l3.b1 21.670000 21.670000 21.670000 21.670000 0.000000 0.000000 21.670000 0.000000000E+00 1251.284048 6807.675170 0.000000 0.000000 +tcsg.4r3.b1 21.670000 21.670000 21.670000 21.670000 0.000000 0.000000 21.670000 0.000000000E+00 596.565816 9047.184677 0.000000 0.000000 +tcsg.a5r3.b1 21.670000 21.670000 21.670000 21.670000 0.000000 0.000000 21.670000 0.000000000E+00 808.573530 7899.259497 0.000000 0.000000 +tcsg.b5r3.b1 21.670000 21.670000 21.670000 21.670000 0.000000 0.000000 21.670000 0.000000000E+00 1025.734336 7179.253012 0.000000 0.000000 +tcla.a5r3.b1 24.080000 24.080000 24.080000 24.080000 0.000000 0.000000 24.080000 0.000000000E+00 3221.348088 4046.952321 0.000000 0.000000 +tcla.b5r3.b1 24.080000 24.080000 24.080000 24.080000 0.000000 0.000000 24.080000 0.000000000E+00 3427.552847 3878.905533 0.000000 0.000000 +tcla.6r3.b1 24.080000 24.080000 24.080000 24.080000 0.000000 0.000000 24.080000 0.000000000E+00 2994.970814 3822.872838 0.000000 0.000000 +tcla.7r3.b1 24.080000 24.080000 24.080000 24.080000 0.000000 0.000000 24.080000 0.000000000E+00 1525.487945 2058.321213 0.000000 0.000000 +tcld.8rj.h1 35.140000 35.140000 35.140000 35.140000 0.000000 0.000000 35.140000 0.000000000E+00 249.860462 3343.978913 0.000000 0.000000 +tcld.10rj.h1 35.140000 35.140000 35.140000 35.140000 0.000000 0.000000 35.140000 0.000000000E+00 610.595304 3381.799293 0.000000 0.000000 +tcld.8rf.h1 35.140000 35.140000 35.140000 35.140000 0.000000 0.000000 35.140000 0.000000000E+00 2622.197467 1839.435939 0.000000 0.000000 +tcld.10rf.h1 35.140000 35.140000 35.140000 35.140000 0.000000 0.000000 35.140000 0.000000000E+00 3132.972026 1404.383778 0.000000 0.000000 +tcld.8ra.h1 35.140000 35.140000 35.140000 35.140000 0.000000 0.000000 35.140000 0.000000000E+00 307.796873 4288.476223 0.000000 0.000000 +tcld.10ra.h1 35.140000 35.140000 35.140000 35.140000 0.000000 0.000000 35.140000 0.000000000E+00 773.920542 3261.572953 0.000000 0.000000 +tcld.8rg.h1 35.140000 35.140000 35.140000 35.140000 0.000000 0.000000 35.140000 0.000000000E+00 307.796881 4288.476385 0.000000 0.000000 +tcld.10rg.h1 35.140000 35.140000 35.140000 35.140000 0.000000 0.000000 35.140000 0.000000000E+00 773.920522 3261.572873 0.000000 0.000000 + +# SUMMARY +# MinGap Collimator: 'tcp.b6l2.b1' +# MinGap Coll ID: 3 +# Min Gap Sigma: 7.570000 +# Pencil Initial: 0 +# Seed before reinit: 1234 diff --git a/test/collimation_tracks2/tracks2.dat.trunc.canonical b/test/collimation_tracks2/tracks2.dat.trunc.canonical index e2be35099..996c23084 100644 --- a/test/collimation_tracks2/tracks2.dat.trunc.canonical +++ b/test/collimation_tracks2/tracks2.dat.trunc.canonical @@ -1,1001 +1,1001 @@ # name turn s x xp y yp DE/E type - 38 6 72295.69 0.13520E+01 -0.34433E-02 -0.18466E+00 -0.74757E-03 -0.105E-03 1 - 38 6 72296.29 0.13498E+01 -0.42371E-02 -0.18455E+00 0.10470E-02 -0.105E-03 1 - 49 6 72295.69 0.13567E+01 -0.37150E-02 0.87832E-01 -0.44705E-04 -0.581E-05 1 - 49 6 72296.29 0.13542E+01 -0.49919E-02 0.87963E-01 -0.11554E-04 -0.581E-05 1 - 38 6 72297.47 0.13448E+01 -0.42371E-02 -0.18331E+00 0.10470E-02 -0.105E-03 1 - 49 6 72297.47 0.13483E+01 -0.49919E-02 0.87949E-01 -0.11554E-04 -0.581E-05 1 - 38 6 72307.47 0.13025E+01 -0.42371E-02 -0.17284E+00 0.10470E-02 -0.105E-03 1 - 49 6 72307.47 0.12983E+01 -0.49919E-02 0.87833E-01 -0.11554E-04 -0.581E-05 1 - 38 6 72316.73 0.12632E+01 -0.42371E-02 -0.16315E+00 0.10470E-02 -0.105E-03 1 - 49 6 72316.73 0.12521E+01 -0.49919E-02 0.87726E-01 -0.11554E-04 -0.581E-05 1 - 38 6 72325.03 0.12281E+01 -0.42371E-02 -0.15446E+00 0.10470E-02 -0.105E-03 1 - 49 6 72325.03 0.12107E+01 -0.49919E-02 0.87631E-01 -0.11554E-04 -0.581E-05 1 - 38 6 72331.03 0.12026E+01 -0.42371E-02 -0.14818E+00 0.10470E-02 -0.105E-03 1 - 49 6 72331.03 0.11807E+01 -0.49919E-02 0.87561E-01 -0.11554E-04 -0.581E-05 1 - 38 6 72337.03 0.11772E+01 -0.42371E-02 -0.14189E+00 0.10470E-02 -0.105E-03 1 - 49 6 72337.03 0.11508E+01 -0.49919E-02 0.87492E-01 -0.11554E-04 -0.581E-05 1 - 38 6 72422.05 0.81696E+00 -0.42371E-02 -0.52874E-01 0.10470E-02 -0.105E-03 1 - 49 6 72422.05 0.72635E+00 -0.49919E-02 0.86510E-01 -0.11554E-04 -0.581E-05 1 - 38 6 72436.80 0.75446E+00 -0.42570E-02 -0.37431E-01 0.10470E-02 -0.105E-03 1 - 49 6 72436.80 0.65272E+00 -0.49930E-02 0.86339E-01 -0.11554E-04 -0.581E-05 1 - 38 6 72436.80 0.75446E+00 -0.42570E-02 -0.37431E-01 0.10470E-02 -0.105E-03 1 - 49 6 72436.80 0.65272E+00 -0.49930E-02 0.86339E-01 -0.11554E-04 -0.581E-05 1 - 38 6 72449.48 0.70051E+00 -0.42570E-02 -0.24160E-01 0.10470E-02 -0.105E-03 1 - 49 6 72449.48 0.58944E+00 -0.49930E-02 0.86193E-01 -0.11554E-04 -0.581E-05 1 - 38 6 72461.48 0.64942E+00 -0.42769E-02 -0.11595E-01 0.10470E-02 -0.105E-03 1 - 49 6 72461.48 0.52952E+00 -0.49941E-02 0.86054E-01 -0.11554E-04 -0.581E-05 1 - 38 6 72461.48 0.64942E+00 -0.42769E-02 -0.11595E-01 0.10470E-02 -0.105E-03 1 - 49 6 72461.48 0.52952E+00 -0.49941E-02 0.86054E-01 -0.11554E-04 -0.581E-05 1 - 38 6 72461.48 0.64942E+00 -0.42769E-02 -0.11595E-01 0.10470E-02 -0.105E-03 1 - 49 6 72461.48 0.52952E+00 -0.49941E-02 0.86054E-01 -0.11554E-04 -0.581E-05 1 - 38 6 72486.50 0.54239E+00 -0.42769E-02 0.14606E-01 0.10470E-02 -0.105E-03 1 - 49 6 72486.50 0.40454E+00 -0.49941E-02 0.85765E-01 -0.11554E-04 -0.581E-05 1 - 38 6 72496.50 0.49962E+00 -0.42769E-02 0.25076E-01 0.10470E-02 -0.105E-03 1 - 49 6 72496.50 0.35460E+00 -0.49941E-02 0.85649E-01 -0.11554E-04 -0.581E-05 1 - 38 6 72507.24 0.45369E+00 -0.42769E-02 0.36323E-01 0.10470E-02 -0.105E-03 1 - 49 6 72507.24 0.30096E+00 -0.49941E-02 0.85525E-01 -0.11554E-04 -0.581E-05 1 - 38 6 72516.50 0.41409E+00 -0.42769E-02 0.46017E-01 0.10470E-02 -0.105E-03 1 - 49 6 72516.50 0.25472E+00 -0.49941E-02 0.85418E-01 -0.11554E-04 -0.581E-05 1 - 38 6 72586.11 0.11636E+00 -0.42769E-02 0.11890E+00 0.10470E-02 -0.105E-03 1 - 49 6 72586.11 -0.92931E-01 -0.49941E-02 0.84614E-01 -0.11554E-04 -0.581E-05 1 - 38 6 72589.64 0.10130E+00 -0.42769E-02 0.12259E+00 0.10470E-02 -0.105E-03 1 - 49 6 72589.64 -0.11052E+00 -0.49941E-02 0.84573E-01 -0.11554E-04 -0.581E-05 1 - 38 6 72594.91 0.78748E-01 -0.42442E-02 0.12811E+00 0.99384E-03 -0.105E-03 1 - 49 6 72594.91 -0.13685E+00 -0.50509E-02 0.84512E-01 -0.46634E-04 -0.581E-05 1 - 38 6 72594.91 0.78748E-01 -0.42442E-02 0.12811E+00 0.99384E-03 -0.105E-03 1 - 49 6 72594.91 -0.13685E+00 -0.50509E-02 0.84512E-01 -0.46634E-04 -0.581E-05 1 - 38 6 72594.91 0.78748E-01 -0.42442E-02 0.12811E+00 0.99384E-03 -0.105E-03 1 - 49 6 72594.91 -0.13685E+00 -0.50509E-02 0.84512E-01 -0.46634E-04 -0.581E-05 1 - 49 6 72605.27 -0.18918E+00 -0.51294E-02 0.84029E-01 -0.81514E-04 -0.581E-05 1 - 49 6 72605.27 -0.18918E+00 -0.51294E-02 0.84029E-01 -0.81514E-04 -0.581E-05 1 - 49 6 72605.27 -0.18918E+00 -0.51294E-02 0.84029E-01 -0.81514E-04 -0.581E-05 1 - 49 6 72613.91 -0.23350E+00 -0.52264E-02 0.83325E-01 -0.11610E-03 -0.581E-05 1 - 49 6 72613.91 -0.23350E+00 -0.52264E-02 0.83325E-01 -0.11610E-03 -0.581E-05 1 - 49 6 72613.91 -0.23350E+00 -0.52264E-02 0.83325E-01 -0.11610E-03 -0.581E-05 1 - 49 6 72624.27 -0.28764E+00 -0.53458E-02 0.82122E-01 -0.15019E-03 -0.581E-05 1 - 49 6 72624.27 -0.28764E+00 -0.53458E-02 0.82122E-01 -0.15019E-03 -0.581E-05 1 - 49 6 72624.27 -0.28764E+00 -0.53458E-02 0.82122E-01 -0.15019E-03 -0.581E-05 1 - 38 6 72632.91 -0.82309E-01 -0.42836E-02 0.16258E+00 0.74350E-03 -0.105E-03 1 - 49 6 72632.91 -0.33383E+00 -0.54843E-02 0.80824E-01 -0.18374E-03 -0.581E-05 1 - 38 6 72632.91 -0.82309E-01 -0.42836E-02 0.16258E+00 0.74350E-03 -0.105E-03 1 - 49 6 72632.91 -0.33383E+00 -0.54843E-02 0.80824E-01 -0.18374E-03 -0.581E-05 1 - 38 6 72632.91 -0.82309E-01 -0.42836E-02 0.16258E+00 0.74350E-03 -0.105E-03 1 - 49 6 72632.91 -0.33383E+00 -0.54843E-02 0.80824E-01 -0.18374E-03 -0.581E-05 1 - 38 6 72643.27 -0.12669E+00 -0.43362E-02 0.17028E+00 0.67281E-03 -0.105E-03 1 - 49 6 72643.27 -0.39065E+00 -0.56465E-02 0.78921E-01 -0.21650E-03 -0.581E-05 1 - 38 6 72643.27 -0.12669E+00 -0.43362E-02 0.17028E+00 0.67281E-03 -0.105E-03 1 - 49 6 72643.27 -0.39065E+00 -0.56465E-02 0.78921E-01 -0.21650E-03 -0.581E-05 1 - 38 6 72643.27 -0.12669E+00 -0.43362E-02 0.17028E+00 0.67281E-03 -0.105E-03 1 - 49 6 72643.27 -0.39065E+00 -0.56465E-02 0.78921E-01 -0.21650E-03 -0.581E-05 1 - 38 6 72651.91 -0.16415E+00 -0.43378E-02 0.17609E+00 0.67102E-03 -0.105E-03 1 - 49 6 72651.91 -0.43943E+00 -0.56509E-02 0.77050E-01 -0.21728E-03 -0.581E-05 1 - 38 6 72651.91 -0.16415E+00 -0.43378E-02 0.17609E+00 0.67102E-03 -0.105E-03 1 - 49 6 72651.91 -0.43943E+00 -0.56509E-02 0.77050E-01 -0.21728E-03 -0.581E-05 1 - 38 6 72651.91 -0.16415E+00 -0.43378E-02 0.17609E+00 0.67102E-03 -0.105E-03 1 - 49 6 72651.91 -0.43943E+00 -0.56509E-02 0.77050E-01 -0.21728E-03 -0.581E-05 1 - 38 6 72662.27 -0.20909E+00 -0.43400E-02 0.18304E+00 0.66916E-03 -0.105E-03 1 - 49 6 72662.27 -0.49798E+00 -0.56560E-02 0.74799E-01 -0.21804E-03 -0.581E-05 1 - 38 6 72662.27 -0.20909E+00 -0.43400E-02 0.18304E+00 0.66916E-03 -0.105E-03 1 - 49 6 72662.27 -0.49798E+00 -0.56560E-02 0.74799E-01 -0.21804E-03 -0.581E-05 1 - 38 6 72662.27 -0.20909E+00 -0.43400E-02 0.18304E+00 0.66916E-03 -0.105E-03 1 - 49 6 72662.27 -0.49798E+00 -0.56560E-02 0.74799E-01 -0.21804E-03 -0.581E-05 1 - 38 6 72670.91 -0.24659E+00 -0.44423E-02 0.18882E+00 0.59078E-03 -0.105E-03 1 - 49 6 72670.91 -0.54685E+00 -0.58830E-02 0.72916E-01 -0.24830E-03 -0.581E-05 1 - 38 6 72670.91 -0.24659E+00 -0.44423E-02 0.18882E+00 0.59078E-03 -0.105E-03 1 - 49 6 72670.91 -0.54685E+00 -0.58830E-02 0.72916E-01 -0.24830E-03 -0.581E-05 1 - 38 6 72670.91 -0.24659E+00 -0.44423E-02 0.18882E+00 0.59078E-03 -0.105E-03 1 - 49 6 72670.91 -0.54685E+00 -0.58830E-02 0.72916E-01 -0.24830E-03 -0.581E-05 1 - 38 6 72681.27 -0.29261E+00 -0.45638E-02 0.19495E+00 0.50985E-03 -0.105E-03 1 - 49 6 72681.27 -0.60779E+00 -0.61353E-02 0.70343E-01 -0.27750E-03 -0.581E-05 1 - 38 6 72681.27 -0.29261E+00 -0.45638E-02 0.19495E+00 0.50985E-03 -0.105E-03 1 - 49 6 72681.27 -0.60779E+00 -0.61353E-02 0.70343E-01 -0.27750E-03 -0.581E-05 1 - 38 6 72681.27 -0.29261E+00 -0.45638E-02 0.19495E+00 0.50985E-03 -0.105E-03 1 - 49 6 72681.27 -0.60779E+00 -0.61353E-02 0.70343E-01 -0.27750E-03 -0.581E-05 1 - 38 6 72689.91 -0.33204E+00 -0.47016E-02 0.19935E+00 0.42709E-03 -0.105E-03 1 - 49 6 72689.91 -0.66080E+00 -0.64096E-02 0.67945E-01 -0.30571E-03 -0.581E-05 1 - 38 6 72689.91 -0.33204E+00 -0.47016E-02 0.19935E+00 0.42709E-03 -0.105E-03 1 - 49 6 72689.91 -0.66080E+00 -0.64096E-02 0.67945E-01 -0.30571E-03 -0.581E-05 1 - 38 6 72689.91 -0.33204E+00 -0.47016E-02 0.19935E+00 0.42709E-03 -0.105E-03 1 - 49 6 72689.91 -0.66080E+00 -0.64096E-02 0.67945E-01 -0.30571E-03 -0.581E-05 1 - 38 6 72700.27 -0.38075E+00 -0.48597E-02 0.20377E+00 0.34250E-03 -0.105E-03 1 - 49 6 72700.27 -0.72721E+00 -0.67114E-02 0.64778E-01 -0.33259E-03 -0.581E-05 1 - 38 6 72700.27 -0.38075E+00 -0.48597E-02 0.20377E+00 0.34250E-03 -0.105E-03 1 - 49 6 72700.27 -0.72721E+00 -0.67114E-02 0.64778E-01 -0.33259E-03 -0.581E-05 1 - 38 6 72700.27 -0.38075E+00 -0.48597E-02 0.20377E+00 0.34250E-03 -0.105E-03 1 - 49 6 72700.27 -0.72721E+00 -0.67114E-02 0.64778E-01 -0.33259E-03 -0.581E-05 1 - 38 6 72705.66 -0.40696E+00 -0.48597E-02 0.20562E+00 0.34250E-03 -0.105E-03 1 - 49 6 72705.66 -0.76340E+00 -0.67114E-02 0.62985E-01 -0.33259E-03 -0.581E-05 1 - 38 6 72803.38 -0.88184E+00 -0.48597E-02 0.23909E+00 0.34250E-03 -0.105E-03 1 - 49 6 72803.38 -0.14192E+01 -0.67114E-02 0.30484E-01 -0.33259E-03 -0.581E-05 1 - 38 6 72812.64 -0.92683E+00 -0.48597E-02 0.24226E+00 0.34250E-03 -0.105E-03 1 - 49 6 72812.64 -0.14814E+01 -0.67114E-02 0.27405E-01 -0.33259E-03 -0.581E-05 1 - 38 6 72823.38 -0.97903E+00 -0.48597E-02 0.24594E+00 0.34250E-03 -0.105E-03 1 - 49 6 72823.38 -0.15535E+01 -0.67114E-02 0.23832E-01 -0.33259E-03 -0.581E-05 1 - 38 6 72832.64 -0.10240E+01 -0.48597E-02 0.24911E+00 0.34250E-03 -0.105E-03 1 - 49 6 72832.64 -0.16156E+01 -0.67114E-02 0.20753E-01 -0.33259E-03 -0.581E-05 1 - 38 6 72881.09 -0.12595E+01 -0.48597E-02 0.26571E+00 0.34250E-03 -0.105E-03 1 - 49 6 72881.09 -0.19407E+01 -0.67114E-02 0.46394E-02 -0.33259E-03 -0.581E-05 1 - 38 6 72886.36 -0.12851E+01 -0.43349E-02 0.26751E+00 0.45175E-03 -0.105E-03 1 - 49 6 72886.36 -0.19761E+01 -0.59045E-02 0.28858E-02 -0.33142E-03 -0.581E-05 1 - 38 6 72886.36 -0.12851E+01 -0.43349E-02 0.26751E+00 0.45175E-03 -0.105E-03 1 - 49 6 72886.36 -0.19761E+01 -0.59045E-02 0.28858E-02 -0.33142E-03 -0.581E-05 1 - 38 6 72886.36 -0.12851E+01 -0.43349E-02 0.26751E+00 0.45175E-03 -0.105E-03 1 - 49 6 72886.36 -0.19761E+01 -0.59045E-02 0.28858E-02 -0.33142E-03 -0.581E-05 1 - 38 6 72896.72 -0.13300E+01 -0.37917E-02 0.27219E+00 0.56290E-03 -0.105E-03 1 - 49 6 72896.72 -0.20373E+01 -0.50726E-02 -0.54770E-03 -0.33164E-03 -0.581E-05 1 - 38 6 72896.72 -0.13300E+01 -0.37917E-02 0.27219E+00 0.56290E-03 -0.105E-03 1 - 49 6 72896.72 -0.20373E+01 -0.50726E-02 -0.54770E-03 -0.33164E-03 -0.581E-05 1 - 38 6 72896.72 -0.13300E+01 -0.37917E-02 0.27219E+00 0.56290E-03 -0.105E-03 1 - 49 6 72896.72 -0.20373E+01 -0.50726E-02 -0.54770E-03 -0.33164E-03 -0.581E-05 1 - 38 6 72905.36 -0.13628E+01 -0.32352E-02 0.27705E+00 0.67605E-03 -0.105E-03 1 - 49 6 72905.36 -0.20811E+01 -0.42228E-02 -0.34131E-02 -0.33303E-03 -0.581E-05 1 - 38 6 72905.36 -0.13628E+01 -0.32352E-02 0.27705E+00 0.67605E-03 -0.105E-03 1 - 49 6 72905.36 -0.20811E+01 -0.42228E-02 -0.34131E-02 -0.33303E-03 -0.581E-05 1 - 38 6 72905.36 -0.13628E+01 -0.32352E-02 0.27705E+00 0.67605E-03 -0.105E-03 1 - 49 6 72905.36 -0.20811E+01 -0.42228E-02 -0.34131E-02 -0.33303E-03 -0.581E-05 1 - 38 6 72915.72 -0.13963E+01 -0.26650E-02 0.28406E+00 0.79205E-03 -0.105E-03 1 - 49 6 72915.72 -0.21249E+01 -0.33551E-02 -0.68633E-02 -0.33584E-03 -0.581E-05 1 - 38 6 72915.72 -0.13963E+01 -0.26650E-02 0.28406E+00 0.79205E-03 -0.105E-03 1 - 49 6 72915.72 -0.21249E+01 -0.33551E-02 -0.68633E-02 -0.33584E-03 -0.581E-05 1 - 38 6 72915.72 -0.13963E+01 -0.26650E-02 0.28406E+00 0.79205E-03 -0.105E-03 1 - 49 6 72915.72 -0.21249E+01 -0.33551E-02 -0.68633E-02 -0.33584E-03 -0.581E-05 1 - 38 6 72930.03 -0.14344E+01 -0.26650E-02 0.29539E+00 0.79205E-03 -0.105E-03 1 - 49 6 72930.03 -0.21729E+01 -0.33551E-02 -0.11669E-01 -0.33584E-03 -0.581E-05 1 - 38 6 72939.29 -0.14591E+01 -0.26650E-02 0.30273E+00 0.79205E-03 -0.105E-03 1 - 49 6 72939.29 -0.22040E+01 -0.33551E-02 -0.14779E-01 -0.33584E-03 -0.581E-05 1 - 38 6 72948.86 -0.14846E+01 -0.20587E-02 0.31031E+00 0.91878E-03 -0.105E-03 1 - 49 6 72948.86 -0.22361E+01 -0.24420E-02 -0.17993E-01 -0.34318E-03 -0.581E-05 1 - 38 6 72948.86 -0.14846E+01 -0.20587E-02 0.31031E+00 0.91878E-03 -0.105E-03 1 - 49 6 72948.86 -0.22361E+01 -0.24420E-02 -0.17993E-01 -0.34318E-03 -0.581E-05 1 - 38 6 72948.86 -0.14846E+01 -0.20587E-02 0.31031E+00 0.91878E-03 -0.105E-03 1 - 49 6 72948.86 -0.22361E+01 -0.24420E-02 -0.17993E-01 -0.34318E-03 -0.581E-05 1 - 38 6 72959.22 -0.15059E+01 -0.14437E-02 0.31983E+00 0.10494E-02 -0.105E-03 1 - 49 6 72959.22 -0.22614E+01 -0.15186E-02 -0.21548E-01 -0.35198E-03 -0.581E-05 1 - 38 6 72959.22 -0.15059E+01 -0.14437E-02 0.31983E+00 0.10494E-02 -0.105E-03 1 - 49 6 72959.22 -0.22614E+01 -0.15186E-02 -0.21548E-01 -0.35198E-03 -0.581E-05 1 - 38 6 72959.22 -0.15059E+01 -0.14437E-02 0.31983E+00 0.10494E-02 -0.105E-03 1 - 49 6 72959.22 -0.22614E+01 -0.15186E-02 -0.21548E-01 -0.35198E-03 -0.581E-05 1 - 38 6 72967.86 -0.15184E+01 -0.12872E-02 0.32889E+00 0.10833E-02 -0.105E-03 1 - 49 6 72967.86 -0.22745E+01 -0.12841E-02 -0.24589E-01 -0.35452E-03 -0.581E-05 1 - 38 6 72967.86 -0.15184E+01 -0.12872E-02 0.32889E+00 0.10833E-02 -0.105E-03 1 - 49 6 72967.86 -0.22745E+01 -0.12841E-02 -0.24589E-01 -0.35452E-03 -0.581E-05 1 - 38 6 72967.86 -0.15184E+01 -0.12872E-02 0.32889E+00 0.10833E-02 -0.105E-03 1 - 49 6 72967.86 -0.22745E+01 -0.12841E-02 -0.24589E-01 -0.35452E-03 -0.581E-05 1 - 38 6 72978.22 -0.15317E+01 -0.11293E-02 0.34012E+00 0.11184E-02 -0.105E-03 1 - 49 6 72978.22 -0.22878E+01 -0.10483E-02 -0.28262E-01 -0.35743E-03 -0.581E-05 1 - 38 6 72978.22 -0.15317E+01 -0.11293E-02 0.34012E+00 0.11184E-02 -0.105E-03 1 - 49 6 72978.22 -0.22878E+01 -0.10483E-02 -0.28262E-01 -0.35743E-03 -0.581E-05 1 - 38 6 72978.22 -0.15317E+01 -0.11293E-02 0.34012E+00 0.11184E-02 -0.105E-03 1 - 49 6 72978.22 -0.22878E+01 -0.10483E-02 -0.28262E-01 -0.35743E-03 -0.581E-05 1 - 38 6 72986.86 -0.15415E+01 -0.49975E-03 0.34978E+00 0.12612E-02 -0.105E-03 1 - 49 6 72986.86 -0.22968E+01 -0.11039E-03 -0.31350E-01 -0.37023E-03 -0.581E-05 1 - 38 6 72986.86 -0.15415E+01 -0.49975E-03 0.34978E+00 0.12612E-02 -0.105E-03 1 - 49 6 72986.86 -0.22968E+01 -0.11039E-03 -0.31350E-01 -0.37023E-03 -0.581E-05 1 - 38 6 72986.86 -0.15415E+01 -0.49975E-03 0.34978E+00 0.12612E-02 -0.105E-03 1 - 49 6 72986.86 -0.22968E+01 -0.11039E-03 -0.31350E-01 -0.37023E-03 -0.581E-05 1 - 38 6 72997.22 -0.15467E+01 0.13188E-03 0.36284E+00 0.14094E-02 -0.105E-03 1 - 49 6 72997.22 -0.22980E+01 0.82797E-03 -0.35186E-01 -0.38460E-03 -0.581E-05 1 - 38 6 72997.22 -0.15467E+01 0.13188E-03 0.36284E+00 0.14094E-02 -0.105E-03 1 - 49 6 72997.22 -0.22980E+01 0.82797E-03 -0.35186E-01 -0.38460E-03 -0.581E-05 1 - 38 6 72997.22 -0.15467E+01 0.13188E-03 0.36284E+00 0.14094E-02 -0.105E-03 1 - 49 6 72997.22 -0.22980E+01 0.82797E-03 -0.35186E-01 -0.38460E-03 -0.581E-05 1 - 38 6 73005.86 -0.15455E+01 0.76304E-03 0.37502E+00 0.15625E-02 -0.105E-03 1 - 49 6 73005.86 -0.22908E+01 0.17634E-02 -0.38509E-01 -0.40033E-03 -0.581E-05 1 - 38 6 73005.86 -0.15455E+01 0.76304E-03 0.37502E+00 0.15625E-02 -0.105E-03 1 - 49 6 73005.86 -0.22908E+01 0.17634E-02 -0.38509E-01 -0.40033E-03 -0.581E-05 1 - 38 6 73005.86 -0.15455E+01 0.76304E-03 0.37502E+00 0.15625E-02 -0.105E-03 1 - 49 6 73005.86 -0.22908E+01 0.17634E-02 -0.38509E-01 -0.40033E-03 -0.581E-05 1 - 38 6 73016.22 -0.15376E+01 0.13910E-02 0.39121E+00 0.17223E-02 -0.105E-03 1 - 49 6 73016.22 -0.22726E+01 0.26914E-02 -0.42656E-01 -0.41774E-03 -0.581E-05 1 - 38 6 73016.22 -0.15376E+01 0.13910E-02 0.39121E+00 0.17223E-02 -0.105E-03 1 - 49 6 73016.22 -0.22726E+01 0.26914E-02 -0.42656E-01 -0.41774E-03 -0.581E-05 1 - 38 6 73016.22 -0.15376E+01 0.13910E-02 0.39121E+00 0.17223E-02 -0.105E-03 1 - 49 6 73016.22 -0.22726E+01 0.26914E-02 -0.42656E-01 -0.41774E-03 -0.581E-05 1 - 38 6 73021.61 -0.15301E+01 0.13910E-02 0.40050E+00 0.17223E-02 -0.105E-03 1 - 49 6 73021.61 -0.22581E+01 0.26914E-02 -0.44909E-01 -0.41774E-03 -0.581E-05 1 - 38 6 73075.21 -0.14556E+01 0.13910E-02 0.49282E+00 0.17223E-02 -0.105E-03 1 - 49 6 73075.21 -0.21138E+01 0.26914E-02 -0.67301E-01 -0.41774E-03 -0.581E-05 1 - 38 6 73085.21 -0.14417E+01 0.13910E-02 0.51004E+00 0.17223E-02 -0.105E-03 1 - 49 6 73085.21 -0.20869E+01 0.26914E-02 -0.71479E-01 -0.41774E-03 -0.581E-05 1 - 38 6 73279.66 -0.11712E+01 0.13910E-02 0.84493E+00 0.17223E-02 -0.105E-03 1 - 38 6 73288.92 -0.11583E+01 0.13910E-02 0.86088E+00 0.17223E-02 -0.105E-03 1 - 38 6 73299.66 -0.11434E+01 0.13910E-02 0.87938E+00 0.17223E-02 -0.105E-03 1 - 38 6 73308.92 -0.11305E+01 0.13910E-02 0.89532E+00 0.17223E-02 -0.105E-03 1 - 38 6 73311.92 -0.11263E+01 0.13910E-02 0.90049E+00 0.17223E-02 -0.105E-03 1 - 38 6 73311.92 -0.11263E+01 0.13910E-02 0.90049E+00 0.17223E-02 -0.105E-03 1 - 38 6 73311.92 -0.11263E+01 0.13910E-02 0.90049E+00 0.17223E-02 -0.105E-03 1 - 38 6 73319.66 -0.11155E+01 0.13910E-02 0.91382E+00 0.17223E-02 -0.105E-03 1 - 38 6 73328.92 -0.11027E+01 0.13910E-02 0.92977E+00 0.17223E-02 -0.105E-03 1 - 38 6 73562.62 -0.77758E+00 0.13910E-02 0.13323E+01 0.17223E-02 -0.105E-03 1 - 38 6 73572.62 -0.76367E+00 0.13910E-02 0.13495E+01 0.17223E-02 -0.105E-03 1 - 38 6 73601.85 -0.72303E+00 0.13910E-02 0.13998E+01 0.17223E-02 -0.105E-03 1 - 38 6 73607.62 -0.71500E+00 0.10990E-02 0.14098E+01 0.11466E-02 -0.105E-03 1 - 38 6 73607.62 -0.71500E+00 0.10990E-02 0.14098E+01 0.11466E-02 -0.105E-03 1 - 38 6 73607.62 -0.71500E+00 0.10990E-02 0.14098E+01 0.11466E-02 -0.105E-03 1 - 38 6 73617.98 -0.70361E+00 0.81165E-03 0.14217E+01 0.56600E-03 -0.105E-03 1 - 38 6 73617.98 -0.70361E+00 0.81165E-03 0.14217E+01 0.56600E-03 -0.105E-03 1 - 38 6 73617.98 -0.70361E+00 0.81165E-03 0.14217E+01 0.56600E-03 -0.105E-03 1 - 38 6 73626.62 -0.69660E+00 0.52717E-03 0.14265E+01 -0.16577E-04 -0.105E-03 1 - 38 6 73626.62 -0.69660E+00 0.52717E-03 0.14265E+01 -0.16577E-04 -0.105E-03 1 - 38 6 73626.62 -0.69660E+00 0.52717E-03 0.14265E+01 -0.16577E-04 -0.105E-03 1 - 38 6 73636.98 -0.69114E+00 0.24492E-03 0.14264E+01 -0.59908E-03 -0.105E-03 1 - 38 6 73636.98 -0.69114E+00 0.24492E-03 0.14264E+01 -0.59908E-03 -0.105E-03 1 - 38 6 73636.98 -0.69114E+00 0.24492E-03 0.14264E+01 -0.59908E-03 -0.105E-03 1 - 38 6 73645.62 -0.68902E+00 0.31596E-03 0.14212E+01 -0.45255E-03 -0.105E-03 1 - 38 6 73645.62 -0.68902E+00 0.31596E-03 0.14212E+01 -0.45255E-03 -0.105E-03 1 - 38 6 73645.62 -0.68902E+00 0.31596E-03 0.14212E+01 -0.45255E-03 -0.105E-03 1 - 38 6 73655.98 -0.68575E+00 0.38666E-03 0.14165E+01 -0.30651E-03 -0.105E-03 1 - 38 6 73655.98 -0.68575E+00 0.38666E-03 0.14165E+01 -0.30651E-03 -0.105E-03 1 - 38 6 73655.98 -0.68575E+00 0.38666E-03 0.14165E+01 -0.30651E-03 -0.105E-03 1 - 38 6 73664.62 -0.68241E+00 0.10798E-03 0.14139E+01 -0.88390E-03 -0.105E-03 1 - 38 6 73664.62 -0.68241E+00 0.10798E-03 0.14139E+01 -0.88390E-03 -0.105E-03 1 - 38 6 73664.62 -0.68241E+00 0.10798E-03 0.14139E+01 -0.88390E-03 -0.105E-03 1 - 38 6 73674.98 -0.68129E+00 -0.17025E-03 0.14047E+01 -0.14576E-02 -0.105E-03 1 - 38 6 73674.98 -0.68129E+00 -0.17025E-03 0.14047E+01 -0.14576E-02 -0.105E-03 1 - 38 6 73674.98 -0.68129E+00 -0.17025E-03 0.14047E+01 -0.14576E-02 -0.105E-03 1 - 38 6 73708.12 -0.68693E+00 -0.45078E-03 0.13564E+01 -0.20115E-02 -0.105E-03 1 - 38 6 73708.12 -0.68693E+00 -0.45078E-03 0.13564E+01 -0.20115E-02 -0.105E-03 1 - 38 6 73708.12 -0.68693E+00 -0.45078E-03 0.13564E+01 -0.20115E-02 -0.105E-03 1 - 38 6 73718.48 -0.69160E+00 -0.73321E-03 0.13356E+01 -0.25569E-02 -0.105E-03 1 - 38 6 73718.48 -0.69160E+00 -0.73321E-03 0.13356E+01 -0.25569E-02 -0.105E-03 1 - 38 6 73718.48 -0.69160E+00 -0.73321E-03 0.13356E+01 -0.25569E-02 -0.105E-03 1 - 38 6 73727.12 -0.69794E+00 -0.10182E-02 0.13135E+01 -0.30933E-02 -0.105E-03 1 - 38 6 73727.12 -0.69794E+00 -0.10182E-02 0.13135E+01 -0.30933E-02 -0.105E-03 1 - 38 6 73727.12 -0.69794E+00 -0.10182E-02 0.13135E+01 -0.30933E-02 -0.105E-03 1 - 38 6 73737.48 -0.70848E+00 -0.13076E-02 0.12814E+01 -0.36166E-02 -0.105E-03 1 - 38 6 73737.48 -0.70848E+00 -0.13076E-02 0.12814E+01 -0.36166E-02 -0.105E-03 1 - 38 6 73737.48 -0.70848E+00 -0.13076E-02 0.12814E+01 -0.36166E-02 -0.105E-03 1 - 38 6 73742.37 -0.71488E+00 -0.13076E-02 0.12637E+01 -0.36166E-02 -0.105E-03 1 - 38 6 73755.20 -0.73165E+00 -0.13076E-02 0.12173E+01 -0.36166E-02 -0.105E-03 1 - 38 6 73765.20 -0.74473E+00 -0.13076E-02 0.11812E+01 -0.36166E-02 -0.105E-03 1 - 38 6 73775.94 -0.75878E+00 -0.13076E-02 0.11423E+01 -0.36166E-02 -0.105E-03 1 - 38 6 73785.20 -0.77088E+00 -0.13076E-02 0.11088E+01 -0.36166E-02 -0.105E-03 1 - 38 6 73835.20 -0.83626E+00 -0.13076E-02 0.92801E+00 -0.36166E-02 -0.105E-03 1 - 38 6 73845.20 -0.84934E+00 -0.13076E-02 0.89184E+00 -0.36166E-02 -0.105E-03 1 - 38 6 73855.94 -0.86338E+00 -0.13076E-02 0.85299E+00 -0.36166E-02 -0.105E-03 1 - 38 6 73865.20 -0.87549E+00 -0.13076E-02 0.81951E+00 -0.36166E-02 -0.105E-03 1 - 38 6 73875.94 -0.88953E+00 -0.13076E-02 0.78066E+00 -0.36166E-02 -0.105E-03 1 - 38 6 73885.20 -0.90164E+00 -0.13076E-02 0.74718E+00 -0.36166E-02 -0.105E-03 1 - 38 6 73917.80 -0.94426E+00 -0.13076E-02 0.62928E+00 -0.36166E-02 -0.105E-03 1 - 38 6 73923.57 -0.95181E+00 -0.91244E-03 0.60841E+00 -0.33640E-02 -0.105E-03 1 - 38 6 73923.57 -0.95181E+00 -0.91244E-03 0.60841E+00 -0.33640E-02 -0.105E-03 1 - 38 6 73923.57 -0.95181E+00 -0.91244E-03 0.60841E+00 -0.33640E-02 -0.105E-03 1 - 38 6 73933.93 -0.96126E+00 -0.51340E-03 0.57356E+00 -0.31259E-02 -0.105E-03 1 - 38 6 73933.93 -0.96126E+00 -0.51340E-03 0.57356E+00 -0.31259E-02 -0.105E-03 1 - 38 6 73933.93 -0.96126E+00 -0.51340E-03 0.57356E+00 -0.31259E-02 -0.105E-03 1 - 38 6 73942.57 -0.96570E+00 -0.11251E-03 0.54655E+00 -0.28990E-02 -0.105E-03 1 - 38 6 73942.57 -0.96570E+00 -0.11251E-03 0.54655E+00 -0.28990E-02 -0.105E-03 1 - 38 6 73942.57 -0.96570E+00 -0.11251E-03 0.54655E+00 -0.28990E-02 -0.105E-03 1 - 38 6 73952.93 -0.96686E+00 0.28887E-03 0.51651E+00 -0.26846E-02 -0.105E-03 1 - 38 6 73952.93 -0.96686E+00 0.28887E-03 0.51651E+00 -0.26846E-02 -0.105E-03 1 - 38 6 73952.93 -0.96686E+00 0.28887E-03 0.51651E+00 -0.26846E-02 -0.105E-03 1 - 38 6 73961.57 -0.96437E+00 0.27908E-03 0.49332E+00 -0.26896E-02 -0.105E-03 1 - 38 6 73961.57 -0.96437E+00 0.27908E-03 0.49332E+00 -0.26896E-02 -0.105E-03 1 - 38 6 73961.57 -0.96437E+00 0.27908E-03 0.49332E+00 -0.26896E-02 -0.105E-03 1 - 38 6 73971.93 -0.96148E+00 0.26932E-03 0.46545E+00 -0.26944E-02 -0.105E-03 1 - 38 6 73971.93 -0.96148E+00 0.26932E-03 0.46545E+00 -0.26944E-02 -0.105E-03 1 - 38 6 73971.93 -0.96148E+00 0.26932E-03 0.46545E+00 -0.26944E-02 -0.105E-03 1 - 38 6 73980.57 -0.95915E+00 0.66749E-03 0.44217E+00 -0.25108E-02 -0.105E-03 1 - 38 6 73980.57 -0.95915E+00 0.66749E-03 0.44217E+00 -0.25108E-02 -0.105E-03 1 - 38 6 73980.57 -0.95915E+00 0.66749E-03 0.44217E+00 -0.25108E-02 -0.105E-03 1 - 38 6 73990.93 -0.95224E+00 0.10628E-02 0.41616E+00 -0.23380E-02 -0.105E-03 1 - 38 6 73990.93 -0.95224E+00 0.10628E-02 0.41616E+00 -0.23380E-02 -0.105E-03 1 - 38 6 73990.93 -0.95224E+00 0.10628E-02 0.41616E+00 -0.23380E-02 -0.105E-03 1 - 38 6 73999.57 -0.94305E+00 0.14543E-02 0.39596E+00 -0.21737E-02 -0.105E-03 1 - 38 6 73999.57 -0.94305E+00 0.14543E-02 0.39596E+00 -0.21737E-02 -0.105E-03 1 - 38 6 73999.57 -0.94305E+00 0.14543E-02 0.39596E+00 -0.21737E-02 -0.105E-03 1 - 38 6 74009.93 -0.92799E+00 0.18395E-02 0.37344E+00 -0.20186E-02 -0.105E-03 1 - 38 6 74009.93 -0.92799E+00 0.18395E-02 0.37344E+00 -0.20186E-02 -0.105E-03 1 - 38 6 74009.93 -0.92799E+00 0.18395E-02 0.37344E+00 -0.20186E-02 -0.105E-03 1 - 38 6 74018.57 -0.91209E+00 0.22181E-02 0.35600E+00 -0.18708E-02 -0.105E-03 1 - 38 6 74018.57 -0.91209E+00 0.22181E-02 0.35600E+00 -0.18708E-02 -0.105E-03 1 - 38 6 74018.57 -0.91209E+00 0.22181E-02 0.35600E+00 -0.18708E-02 -0.105E-03 1 - 38 6 74028.93 -0.88911E+00 0.25872E-02 0.33662E+00 -0.17311E-02 -0.105E-03 1 - 38 6 74028.93 -0.88911E+00 0.25872E-02 0.33662E+00 -0.17311E-02 -0.105E-03 1 - 38 6 74028.93 -0.88911E+00 0.25872E-02 0.33662E+00 -0.17311E-02 -0.105E-03 1 - 38 6 74033.82 -0.87645E+00 0.25872E-02 0.32815E+00 -0.17311E-02 -0.105E-03 1 - 38 6 74048.96 -0.83727E+00 0.25872E-02 0.30194E+00 -0.17311E-02 -0.105E-03 1 - 38 6 74058.22 -0.81332E+00 0.25872E-02 0.28591E+00 -0.17311E-02 -0.105E-03 1 - 38 6 74084.29 -0.74587E+00 0.25872E-02 0.24078E+00 -0.17311E-02 -0.105E-03 1 - 38 6 74162.36 -0.54389E+00 0.25674E-02 0.10563E+00 -0.17311E-02 -0.105E-03 1 - 38 6 74162.36 -0.54389E+00 0.25674E-02 0.10563E+00 -0.17311E-02 -0.105E-03 1 - 38 6 74162.36 -0.54389E+00 0.25674E-02 0.10563E+00 -0.17311E-02 -0.105E-03 1 - 38 6 74187.04 -0.48054E+00 0.25475E-02 0.62919E-01 -0.17311E-02 -0.105E-03 1 - 38 6 74187.04 -0.48054E+00 0.25475E-02 0.62919E-01 -0.17311E-02 -0.105E-03 1 - 38 6 74238.66 -0.34902E+00 0.25475E-02 -0.26456E-01 -0.17311E-02 -0.105E-03 1 - 38 6 74362.81 -0.32757E-01 0.25674E-02 -0.24136E+00 -0.17311E-02 -0.105E-03 1 - 38 6 74362.81 -0.32757E-01 0.25674E-02 -0.24136E+00 -0.17311E-02 -0.105E-03 1 - 38 6 74383.98 0.21607E-01 0.25872E-02 -0.27802E+00 -0.17311E-02 -0.105E-03 1 - 38 6 74383.98 0.21607E-01 0.25872E-02 -0.27802E+00 -0.17311E-02 -0.105E-03 1 - 38 6 74383.98 0.21607E-01 0.25872E-02 -0.27802E+00 -0.17311E-02 -0.105E-03 1 - 38 6 74405.01 0.76007E-01 0.25872E-02 -0.31442E+00 -0.17311E-02 -0.105E-03 1 - 38 6 74415.01 0.10188E+00 0.25872E-02 -0.33173E+00 -0.17311E-02 -0.105E-03 1 - 38 6 74429.90 0.14040E+00 0.25872E-02 -0.35750E+00 -0.17311E-02 -0.105E-03 1 - 38 6 74434.58 0.15252E+00 0.26439E-02 -0.36561E+00 -0.15952E-02 -0.105E-03 1 - 38 6 74434.58 0.15252E+00 0.26439E-02 -0.36561E+00 -0.15952E-02 -0.105E-03 1 - 38 6 74434.58 0.15252E+00 0.26439E-02 -0.36561E+00 -0.15952E-02 -0.105E-03 1 - 38 6 74438.91 0.16397E+00 0.27049E-02 -0.37252E+00 -0.14567E-02 -0.105E-03 1 - 38 6 74438.91 0.16397E+00 0.27049E-02 -0.37252E+00 -0.14567E-02 -0.105E-03 1 - 38 6 74441.86 0.17193E+00 0.27688E-02 -0.37681E+00 -0.13166E-02 -0.105E-03 1 - 38 6 74441.86 0.17193E+00 0.27688E-02 -0.37681E+00 -0.13166E-02 -0.105E-03 1 - 38 6 74446.19 0.18393E+00 0.28372E-02 -0.38251E+00 -0.11744E-02 -0.105E-03 1 - 38 6 74446.19 0.18393E+00 0.28372E-02 -0.38251E+00 -0.11744E-02 -0.105E-03 1 - 38 6 74449.13 0.19228E+00 0.29087E-02 -0.38597E+00 -0.10309E-02 -0.105E-03 1 - 38 6 74449.13 0.19228E+00 0.29087E-02 -0.38597E+00 -0.10309E-02 -0.105E-03 1 - 38 6 74453.46 0.20488E+00 0.29849E-02 -0.39043E+00 -0.88575E-03 -0.105E-03 1 - 38 6 74453.46 0.20488E+00 0.29849E-02 -0.39043E+00 -0.88575E-03 -0.105E-03 1 - 38 6 74456.41 0.21366E+00 0.30643E-02 -0.39304E+00 -0.73962E-03 -0.105E-03 1 - 38 6 74456.41 0.21366E+00 0.30643E-02 -0.39304E+00 -0.73962E-03 -0.105E-03 1 - 38 6 74460.74 0.22694E+00 0.31487E-02 -0.39625E+00 -0.59231E-03 -0.105E-03 1 - 38 6 74460.74 0.22694E+00 0.31487E-02 -0.39625E+00 -0.59231E-03 -0.105E-03 1 - 38 6 74463.69 0.23622E+00 0.32365E-02 -0.39799E+00 -0.44435E-03 -0.105E-03 1 - 38 6 74463.69 0.23622E+00 0.32365E-02 -0.39799E+00 -0.44435E-03 -0.105E-03 1 - 38 6 74468.02 0.25024E+00 0.33295E-02 -0.39992E+00 -0.29567E-03 -0.105E-03 1 - 38 6 74468.02 0.25024E+00 0.33295E-02 -0.39992E+00 -0.29567E-03 -0.105E-03 1 - 38 6 74470.97 0.26005E+00 0.34262E-02 -0.40079E+00 -0.14666E-03 -0.105E-03 1 - 38 6 74470.97 0.26005E+00 0.34262E-02 -0.40079E+00 -0.14666E-03 -0.105E-03 1 - 38 6 74475.30 0.27490E+00 0.35284E-02 -0.40142E+00 0.25741E-05 -0.105E-03 1 - 38 6 74475.30 0.27490E+00 0.35284E-02 -0.40142E+00 0.25741E-05 -0.105E-03 1 - 38 6 74475.30 0.27490E+00 0.35284E-02 -0.40142E+00 0.25741E-05 -0.105E-03 1 - 38 6 74503.15 0.37316E+00 0.35284E-02 -0.40135E+00 0.25741E-05 -0.105E-03 1 - 38 6 74561.60 0.57939E+00 0.35284E-02 -0.40120E+00 0.25741E-05 -0.105E-03 1 - 38 6 74620.08 0.78574E+00 0.35284E-02 -0.40105E+00 0.25741E-05 -0.105E-03 1 - 38 6 74627.65 0.81244E+00 0.12639E-02 -0.40103E+00 -0.11152E-02 -0.105E-03 1 - 38 6 74627.65 0.81244E+00 0.12639E-02 -0.40103E+00 -0.11152E-02 -0.105E-03 1 - 38 6 74627.65 0.81244E+00 0.12639E-02 -0.40103E+00 -0.11152E-02 -0.105E-03 1 - 38 6 74637.98 0.82550E+00 -0.10369E-02 -0.41255E+00 -0.22651E-02 -0.105E-03 1 - 38 6 74637.98 0.82550E+00 -0.10369E-02 -0.41255E+00 -0.22651E-02 -0.105E-03 1 - 38 6 74642.49 0.82082E+00 -0.13393E-02 -0.42277E+00 -0.24208E-02 -0.105E-03 1 - 38 6 74642.49 0.82082E+00 -0.13393E-02 -0.42277E+00 -0.24208E-02 -0.105E-03 1 - 38 6 74646.82 0.81502E+00 -0.16395E-02 -0.43326E+00 -0.25804E-02 -0.105E-03 1 - 38 6 74646.82 0.81502E+00 -0.16395E-02 -0.43326E+00 -0.25804E-02 -0.105E-03 1 - 38 6 74657.95 0.79677E+00 -0.42306E-02 -0.46198E+00 -0.40828E-02 -0.105E-03 1 - 38 6 74657.95 0.79677E+00 -0.42306E-02 -0.46198E+00 -0.40828E-02 -0.105E-03 1 - 38 6 74664.02 0.77111E+00 -0.67381E-02 -0.48675E+00 -0.56656E-02 -0.105E-03 1 - 38 6 74664.02 0.77111E+00 -0.67381E-02 -0.48675E+00 -0.56656E-02 -0.105E-03 1 - 38 6 74681.14 0.65573E+00 0.38421E-03 -0.58377E+00 0.67511E-03 -0.105E-03 1 - 38 6 74681.14 0.65573E+00 0.38421E-03 -0.58377E+00 0.67511E-03 -0.105E-03 1 - 38 6 74687.21 0.65806E+00 0.75319E-02 -0.57967E+00 0.69714E-02 -0.105E-03 1 - 38 6 74687.21 0.65806E+00 0.75319E-02 -0.57967E+00 0.69714E-02 -0.105E-03 1 - 38 6 74704.33 0.78703E+00 0.10606E-03 -0.46030E+00 0.26283E-02 -0.105E-03 1 - 38 6 74704.33 0.78703E+00 0.10606E-03 -0.46030E+00 0.26283E-02 -0.105E-03 1 - 38 6 74710.40 0.78767E+00 -0.73258E-02 -0.44435E+00 -0.15643E-02 -0.105E-03 1 - 38 6 74710.40 0.78767E+00 -0.73258E-02 -0.44435E+00 -0.15643E-02 -0.105E-03 1 - 38 6 74717.97 0.73221E+00 -0.73967E-02 -0.45620E+00 -0.15643E-02 -0.105E-03 1 - 38 6 74717.97 0.73221E+00 -0.73967E-02 -0.45620E+00 -0.15643E-02 -0.105E-03 1 - 38 6 74727.50 0.66170E+00 -0.74677E-02 -0.47111E+00 -0.15643E-02 -0.105E-03 1 - 38 6 74727.50 0.66170E+00 -0.74677E-02 -0.47111E+00 -0.15643E-02 -0.105E-03 1 - 38 6 74733.63 0.61594E+00 -0.75386E-02 -0.48069E+00 -0.15643E-02 -0.105E-03 1 - 38 6 74733.63 0.61594E+00 -0.75386E-02 -0.48069E+00 -0.15643E-02 -0.105E-03 1 - 38 6 74743.16 0.54408E+00 -0.76095E-02 -0.49560E+00 -0.15643E-02 -0.105E-03 1 - 38 6 74743.16 0.54408E+00 -0.76095E-02 -0.49560E+00 -0.15643E-02 -0.105E-03 1 - 38 6 74749.29 0.49745E+00 -0.76804E-02 -0.50519E+00 -0.15643E-02 -0.105E-03 1 - 38 6 74749.29 0.49745E+00 -0.76804E-02 -0.50519E+00 -0.15643E-02 -0.105E-03 1 - 38 6 74758.83 0.42423E+00 -0.77514E-02 -0.52010E+00 -0.15643E-02 -0.105E-03 1 - 38 6 74758.83 0.42423E+00 -0.77514E-02 -0.52010E+00 -0.15643E-02 -0.105E-03 1 - 38 6 74764.95 0.37674E+00 -0.78223E-02 -0.52969E+00 -0.15643E-02 -0.105E-03 1 - 38 6 74764.95 0.37674E+00 -0.78223E-02 -0.52969E+00 -0.15643E-02 -0.105E-03 1 - 38 6 74774.49 0.30217E+00 -0.78932E-02 -0.54460E+00 -0.15643E-02 -0.105E-03 1 - 38 6 74774.49 0.30217E+00 -0.78932E-02 -0.54460E+00 -0.15643E-02 -0.105E-03 1 - 38 6 74786.21 0.20966E+00 -0.65157E-02 -0.56293E+00 0.21342E-02 -0.105E-03 1 - 38 6 74786.21 0.20966E+00 -0.65157E-02 -0.56293E+00 0.21342E-02 -0.105E-03 1 - 38 6 74792.87 0.16622E+00 -0.54236E-02 -0.54870E+00 0.57392E-02 -0.105E-03 1 - 38 6 74792.87 0.16622E+00 -0.54236E-02 -0.54870E+00 0.57392E-02 -0.105E-03 1 - 38 6 74800.59 0.12435E+00 -0.54945E-02 -0.50440E+00 0.57392E-02 -0.105E-03 1 - 38 6 74800.59 0.12435E+00 -0.54945E-02 -0.50440E+00 0.57392E-02 -0.105E-03 1 - 38 6 74810.13 0.71972E-01 -0.55654E-02 -0.44968E+00 0.57392E-02 -0.105E-03 1 - 38 6 74810.13 0.71972E-01 -0.55654E-02 -0.44968E+00 0.57392E-02 -0.105E-03 1 - 38 6 74816.25 0.37874E-01 -0.56363E-02 -0.41452E+00 0.57392E-02 -0.105E-03 1 - 38 6 74816.25 0.37874E-01 -0.56363E-02 -0.41452E+00 0.57392E-02 -0.105E-03 1 - 38 6 74825.79 -0.15859E-01 -0.57072E-02 -0.35981E+00 0.57392E-02 -0.105E-03 1 - 38 6 74825.79 -0.15859E-01 -0.57072E-02 -0.35981E+00 0.57392E-02 -0.105E-03 1 - 38 6 74831.91 -0.50826E-01 -0.57781E-02 -0.32464E+00 0.57392E-02 -0.105E-03 1 - 38 6 74831.91 -0.50826E-01 -0.57781E-02 -0.32464E+00 0.57392E-02 -0.105E-03 1 - 38 6 74841.45 -0.10591E+00 -0.58489E-02 -0.26993E+00 0.57392E-02 -0.105E-03 1 - 38 6 74841.45 -0.10591E+00 -0.58489E-02 -0.26993E+00 0.57392E-02 -0.105E-03 1 - 38 6 74847.57 -0.14175E+00 -0.59198E-02 -0.23477E+00 0.57392E-02 -0.105E-03 1 - 38 6 74847.57 -0.14175E+00 -0.59198E-02 -0.23477E+00 0.57392E-02 -0.105E-03 1 - 38 6 74857.11 -0.19818E+00 -0.59907E-02 -0.18005E+00 0.57392E-02 -0.105E-03 1 - 38 6 74857.11 -0.19818E+00 -0.59907E-02 -0.18005E+00 0.57392E-02 -0.105E-03 1 - 38 6 74864.83 -0.24443E+00 -0.34285E-02 -0.13575E+00 0.43162E-02 -0.105E-03 1 - 38 6 74864.83 -0.24443E+00 -0.34285E-02 -0.13575E+00 0.43162E-02 -0.105E-03 1 - 38 6 74871.49 -0.26729E+00 -0.62673E-03 -0.10697E+00 0.31949E-02 -0.105E-03 1 - 38 6 74871.49 -0.26729E+00 -0.62673E-03 -0.10697E+00 0.31949E-02 -0.105E-03 1 - 38 6 74879.21 -0.27213E+00 -0.69760E-03 -0.82309E-01 0.31949E-02 -0.105E-03 1 - 38 6 74879.21 -0.27213E+00 -0.69760E-03 -0.82309E-01 0.31949E-02 -0.105E-03 1 - 38 6 74888.75 -0.27878E+00 -0.76847E-03 -0.51851E-01 0.31949E-02 -0.105E-03 1 - 38 6 74888.75 -0.27878E+00 -0.76847E-03 -0.51851E-01 0.31949E-02 -0.105E-03 1 - 38 6 74894.87 -0.28348E+00 -0.83934E-03 -0.32276E-01 0.31949E-02 -0.105E-03 1 - 38 6 74894.87 -0.28348E+00 -0.83934E-03 -0.32276E-01 0.31949E-02 -0.105E-03 1 - 38 6 74904.41 -0.29149E+00 -0.91021E-03 -0.18183E-02 0.31949E-02 -0.105E-03 1 - 38 6 74904.41 -0.29149E+00 -0.91021E-03 -0.18183E-02 0.31949E-02 -0.105E-03 1 - 38 6 74910.53 -0.29706E+00 -0.98108E-03 0.17756E-01 0.31949E-02 -0.105E-03 1 - 38 6 74910.53 -0.29706E+00 -0.98108E-03 0.17756E-01 0.31949E-02 -0.105E-03 1 - 38 6 74920.07 -0.30642E+00 -0.10519E-02 0.48214E-01 0.31949E-02 -0.105E-03 1 - 38 6 74920.07 -0.30642E+00 -0.10519E-02 0.48214E-01 0.31949E-02 -0.105E-03 1 - 38 6 74926.19 -0.31286E+00 -0.11228E-02 0.67789E-01 0.31949E-02 -0.105E-03 1 - 38 6 74926.19 -0.31286E+00 -0.11228E-02 0.67789E-01 0.31949E-02 -0.105E-03 1 - 38 6 74935.73 -0.32356E+00 -0.11937E-02 0.98246E-01 0.31949E-02 -0.105E-03 1 - 38 6 74935.73 -0.32356E+00 -0.11937E-02 0.98246E-01 0.31949E-02 -0.105E-03 1 - 38 6 74947.71 -0.33787E+00 -0.42867E-02 0.13654E+00 0.19449E-02 -0.105E-03 1 - 38 6 74947.71 -0.33787E+00 -0.42867E-02 0.13654E+00 0.19449E-02 -0.105E-03 1 - 38 6 74955.45 -0.37102E+00 -0.76832E-02 0.15158E+00 0.55728E-03 -0.105E-03 1 - 38 6 74955.45 -0.37102E+00 -0.76832E-02 0.15158E+00 0.55728E-03 -0.105E-03 1 - 38 6 74963.43 -0.43239E+00 -0.77540E-02 0.15603E+00 0.55728E-03 -0.105E-03 1 - 38 6 74963.43 -0.43239E+00 -0.77540E-02 0.15603E+00 0.55728E-03 -0.105E-03 1 - 38 6 74972.97 -0.50631E+00 -0.78249E-02 0.16135E+00 0.55728E-03 -0.105E-03 1 - 38 6 74972.97 -0.50631E+00 -0.78249E-02 0.16135E+00 0.55728E-03 -0.105E-03 1 - 38 6 74979.09 -0.55425E+00 -0.78957E-02 0.16476E+00 0.55728E-03 -0.105E-03 1 - 38 6 74979.09 -0.55425E+00 -0.78957E-02 0.16476E+00 0.55728E-03 -0.105E-03 1 - 38 6 74988.63 -0.62952E+00 -0.79666E-02 0.17007E+00 0.55728E-03 -0.105E-03 1 - 38 6 74988.63 -0.62952E+00 -0.79666E-02 0.17007E+00 0.55728E-03 -0.105E-03 1 - 38 6 74994.75 -0.67833E+00 -0.80374E-02 0.17349E+00 0.55728E-03 -0.105E-03 1 - 38 6 74994.75 -0.67833E+00 -0.80374E-02 0.17349E+00 0.55728E-03 -0.105E-03 1 - 38 6 75004.29 -0.75496E+00 -0.81083E-02 0.17880E+00 0.55728E-03 -0.105E-03 1 - 38 6 75004.29 -0.75496E+00 -0.81083E-02 0.17880E+00 0.55728E-03 -0.105E-03 1 - 38 6 75010.41 -0.80463E+00 -0.81791E-02 0.18222E+00 0.55728E-03 -0.105E-03 1 - 38 6 75010.41 -0.80463E+00 -0.81791E-02 0.18222E+00 0.55728E-03 -0.105E-03 1 - 38 6 75019.95 -0.88261E+00 -0.82499E-02 0.18753E+00 0.55728E-03 -0.105E-03 1 - 38 6 75019.95 -0.88261E+00 -0.82499E-02 0.18753E+00 0.55728E-03 -0.105E-03 1 - 38 6 75055.36 -0.11748E+01 -0.77173E-02 0.20726E+00 0.65124E-03 -0.105E-03 1 - 38 6 75055.36 -0.11748E+01 -0.77173E-02 0.20726E+00 0.65124E-03 -0.105E-03 1 - 38 6 75056.70 -0.11851E+01 -0.71801E-02 0.20813E+00 0.74560E-03 -0.105E-03 1 - 38 6 75056.70 -0.11851E+01 -0.71801E-02 0.20813E+00 0.74560E-03 -0.105E-03 1 - 38 6 75058.32 -0.11968E+01 0.99428E-03 0.20935E+00 0.21755E-02 -0.105E-03 1 - 38 6 75058.32 -0.11968E+01 0.99428E-03 0.20935E+00 0.21755E-02 -0.105E-03 1 - 38 6 75062.32 -0.11928E+01 0.91415E-02 0.21805E+00 0.36649E-02 -0.105E-03 1 - 38 6 75062.32 -0.11928E+01 0.91415E-02 0.21805E+00 0.36649E-02 -0.105E-03 1 - 38 6 75069.38 -0.11283E+01 0.90707E-02 0.24391E+00 0.36649E-02 -0.105E-03 1 - 38 6 75069.38 -0.11283E+01 0.90707E-02 0.24391E+00 0.36649E-02 -0.105E-03 1 - 38 6 75078.91 -0.10418E+01 0.89998E-02 0.27885E+00 0.36649E-02 -0.105E-03 1 - 38 6 75078.91 -0.10418E+01 0.89998E-02 0.27885E+00 0.36649E-02 -0.105E-03 1 - 38 6 75085.04 -0.98668E+00 0.89290E-02 0.30130E+00 0.36649E-02 -0.105E-03 1 - 38 6 75085.04 -0.98668E+00 0.89290E-02 0.30130E+00 0.36649E-02 -0.105E-03 1 - 38 6 75094.57 -0.90156E+00 0.88582E-02 0.33624E+00 0.36649E-02 -0.105E-03 1 - 38 6 75094.57 -0.90156E+00 0.88582E-02 0.33624E+00 0.36649E-02 -0.105E-03 1 - 38 6 75100.70 -0.84728E+00 0.87874E-02 0.35869E+00 0.36649E-02 -0.105E-03 1 - 38 6 75100.70 -0.84728E+00 0.87874E-02 0.35869E+00 0.36649E-02 -0.105E-03 1 - 38 6 75110.23 -0.76351E+00 0.87165E-02 0.39363E+00 0.36649E-02 -0.105E-03 1 - 38 6 75110.23 -0.76351E+00 0.87165E-02 0.39363E+00 0.36649E-02 -0.105E-03 1 - 38 6 75116.36 -0.71011E+00 0.86457E-02 0.41608E+00 0.36649E-02 -0.105E-03 1 - 38 6 75116.36 -0.71011E+00 0.86457E-02 0.41608E+00 0.36649E-02 -0.105E-03 1 - 38 6 75125.89 -0.62768E+00 0.85748E-02 0.45102E+00 0.36649E-02 -0.105E-03 1 - 38 6 75125.89 -0.62768E+00 0.85748E-02 0.45102E+00 0.36649E-02 -0.105E-03 1 - 38 6 75132.02 -0.57515E+00 0.85040E-02 0.47348E+00 0.36649E-02 -0.105E-03 1 - 38 6 75132.02 -0.57515E+00 0.85040E-02 0.47348E+00 0.36649E-02 -0.105E-03 1 - 38 6 75141.55 -0.49408E+00 0.84331E-02 0.50842E+00 0.36649E-02 -0.105E-03 1 - 38 6 75141.55 -0.49408E+00 0.84331E-02 0.50842E+00 0.36649E-02 -0.105E-03 1 - 38 6 75147.68 -0.44241E+00 0.83623E-02 0.53087E+00 0.36649E-02 -0.105E-03 1 - 38 6 75147.68 -0.44241E+00 0.83623E-02 0.53087E+00 0.36649E-02 -0.105E-03 1 - 38 6 75157.21 -0.36269E+00 0.82914E-02 0.56581E+00 0.36649E-02 -0.105E-03 1 - 38 6 75157.21 -0.36269E+00 0.82914E-02 0.56581E+00 0.36649E-02 -0.105E-03 1 - 38 6 75161.31 -0.32874E+00 0.82094E-02 0.58081E+00 0.35200E-02 -0.105E-03 1 - 38 6 75161.31 -0.32874E+00 0.82094E-02 0.58081E+00 0.35200E-02 -0.105E-03 1 - 38 6 75162.64 -0.31780E+00 0.81302E-02 0.58551E+00 0.33740E-02 -0.105E-03 1 - 38 6 75162.64 -0.31780E+00 0.81302E-02 0.58551E+00 0.33740E-02 -0.105E-03 1 - 38 6 75164.27 -0.30456E+00 0.60590E-02 0.59100E+00 -0.64505E-03 -0.105E-03 1 - 38 6 75164.27 -0.30456E+00 0.60590E-02 0.59100E+00 -0.64505E-03 -0.105E-03 1 - 38 6 75168.27 -0.28032E+00 0.41527E-02 0.58842E+00 -0.46466E-02 -0.105E-03 1 - 38 6 75168.27 -0.28032E+00 0.41527E-02 0.58842E+00 -0.46466E-02 -0.105E-03 1 - 38 6 75175.33 -0.25102E+00 0.40818E-02 0.55564E+00 -0.46466E-02 -0.105E-03 1 - 38 6 75175.33 -0.25102E+00 0.40818E-02 0.55564E+00 -0.46466E-02 -0.105E-03 1 - 38 6 75184.86 -0.21211E+00 0.40109E-02 0.51134E+00 -0.46466E-02 -0.105E-03 1 - 38 6 75184.86 -0.21211E+00 0.40109E-02 0.51134E+00 -0.46466E-02 -0.105E-03 1 - 38 6 75190.99 -0.18754E+00 0.39401E-02 0.48287E+00 -0.46466E-02 -0.105E-03 1 - 38 6 75190.99 -0.18754E+00 0.39401E-02 0.48287E+00 -0.46466E-02 -0.105E-03 1 - 38 6 75200.52 -0.14997E+00 0.38692E-02 0.43857E+00 -0.46466E-02 -0.105E-03 1 - 38 6 75200.52 -0.14997E+00 0.38692E-02 0.43857E+00 -0.46466E-02 -0.105E-03 1 - 38 6 75206.65 -0.12627E+00 0.37983E-02 0.41010E+00 -0.46466E-02 -0.105E-03 1 - 38 6 75206.65 -0.12627E+00 0.37983E-02 0.41010E+00 -0.46466E-02 -0.105E-03 1 - 38 6 75216.18 -0.90057E-01 0.37274E-02 0.36580E+00 -0.46466E-02 -0.105E-03 1 - 38 6 75216.18 -0.90057E-01 0.37274E-02 0.36580E+00 -0.46466E-02 -0.105E-03 1 - 38 6 75222.31 -0.67220E-01 0.36565E-02 0.33734E+00 -0.46466E-02 -0.105E-03 1 - 38 6 75222.31 -0.67220E-01 0.36565E-02 0.33734E+00 -0.46466E-02 -0.105E-03 1 - 38 6 75231.84 -0.32360E-01 0.35857E-02 0.29304E+00 -0.46466E-02 -0.105E-03 1 - 38 6 75231.84 -0.32360E-01 0.35857E-02 0.29304E+00 -0.46466E-02 -0.105E-03 1 - 38 6 75237.97 -0.10392E-01 0.35148E-02 0.26457E+00 -0.46466E-02 -0.105E-03 1 - 38 6 75237.97 -0.10392E-01 0.35148E-02 0.26457E+00 -0.46466E-02 -0.105E-03 1 - 38 6 75247.50 0.23116E-01 0.34439E-02 0.22027E+00 -0.46466E-02 -0.105E-03 1 - 38 6 75247.50 0.23116E-01 0.34439E-02 0.22027E+00 -0.46466E-02 -0.105E-03 1 - 38 6 75253.63 0.44216E-01 0.33730E-02 0.19180E+00 -0.46466E-02 -0.105E-03 1 - 38 6 75253.63 0.44216E-01 0.33730E-02 0.19180E+00 -0.46466E-02 -0.105E-03 1 - 38 6 75263.16 0.76372E-01 0.33021E-02 0.14751E+00 -0.46466E-02 -0.105E-03 1 - 38 6 75263.16 0.76372E-01 0.33021E-02 0.14751E+00 -0.46466E-02 -0.105E-03 1 - 38 6 75267.25 0.89890E-01 0.32756E-02 0.12848E+00 -0.46088E-02 -0.105E-03 1 - 38 6 75267.25 0.89890E-01 0.32756E-02 0.12848E+00 -0.46088E-02 -0.105E-03 1 - 38 6 75268.59 0.94258E-01 0.32479E-02 0.12234E+00 -0.45727E-02 -0.105E-03 1 - 38 6 75268.59 0.94258E-01 0.32479E-02 0.12234E+00 -0.45727E-02 -0.105E-03 1 - 38 6 75270.22 0.99546E-01 0.25680E-02 0.11489E+00 -0.37880E-02 -0.105E-03 1 - 38 6 75270.22 0.99546E-01 0.25680E-02 0.11489E+00 -0.37880E-02 -0.105E-03 1 - 38 6 75274.22 0.10982E+00 0.18179E-02 0.99740E-01 -0.31067E-02 -0.105E-03 1 - 38 6 75274.22 0.10982E+00 0.18179E-02 0.99740E-01 -0.31067E-02 -0.105E-03 1 - 38 6 75275.92 0.11291E+00 0.18178E-02 0.94459E-01 -0.31066E-02 -0.105E-03 1 - 38 6 75275.92 0.11291E+00 0.18178E-02 0.94459E-01 -0.31066E-02 -0.105E-03 1 - 38 6 75276.72 0.11436E+00 0.18178E-02 0.91974E-01 -0.31065E-02 -0.105E-03 1 - 38 6 75276.72 0.11436E+00 0.18178E-02 0.91974E-01 -0.31065E-02 -0.105E-03 1 - 38 6 75281.27 0.12264E+00 0.17469E-02 0.77822E-01 -0.31065E-02 -0.105E-03 1 - 38 6 75281.27 0.12264E+00 0.17469E-02 0.77822E-01 -0.31065E-02 -0.105E-03 1 - 38 6 75290.80 0.13930E+00 0.16760E-02 0.48207E-01 -0.31065E-02 -0.105E-03 1 - 38 6 75290.80 0.13930E+00 0.16760E-02 0.48207E-01 -0.31065E-02 -0.105E-03 1 - 38 6 75296.93 0.14957E+00 0.16051E-02 0.29174E-01 -0.31065E-02 -0.105E-03 1 - 38 6 75296.93 0.14957E+00 0.16051E-02 0.29174E-01 -0.31065E-02 -0.105E-03 1 - 38 6 75306.46 0.16487E+00 0.15342E-02 -0.44039E-03 -0.31065E-02 -0.105E-03 1 - 38 6 75306.46 0.16487E+00 0.15342E-02 -0.44039E-03 -0.31065E-02 -0.105E-03 1 - 38 6 75312.59 0.17427E+00 0.14633E-02 -0.19473E-01 -0.31065E-02 -0.105E-03 1 - 38 6 75312.59 0.17427E+00 0.14633E-02 -0.19473E-01 -0.31065E-02 -0.105E-03 1 - 38 6 75322.12 0.18822E+00 0.13924E-02 -0.49088E-01 -0.31065E-02 -0.105E-03 1 - 38 6 75322.12 0.18822E+00 0.13924E-02 -0.49088E-01 -0.31065E-02 -0.105E-03 1 - 38 6 75328.25 0.19675E+00 0.13215E-02 -0.68121E-01 -0.31065E-02 -0.105E-03 1 - 38 6 75328.25 0.19675E+00 0.13215E-02 -0.68121E-01 -0.31065E-02 -0.105E-03 1 - 38 6 75337.78 0.20935E+00 0.12506E-02 -0.97736E-01 -0.31065E-02 -0.105E-03 1 - 38 6 75337.78 0.20935E+00 0.12506E-02 -0.97736E-01 -0.31065E-02 -0.105E-03 1 - 38 6 75343.91 0.21701E+00 0.11797E-02 -0.11677E+00 -0.31065E-02 -0.105E-03 1 - 38 6 75343.91 0.21701E+00 0.11797E-02 -0.11677E+00 -0.31065E-02 -0.105E-03 1 - 38 6 75353.44 0.22826E+00 0.11088E-02 -0.14638E+00 -0.31065E-02 -0.105E-03 1 - 38 6 75353.44 0.22826E+00 0.11088E-02 -0.14638E+00 -0.31065E-02 -0.105E-03 1 - 38 6 75359.57 0.23505E+00 0.10379E-02 -0.16542E+00 -0.31065E-02 -0.105E-03 1 - 38 6 75359.57 0.23505E+00 0.10379E-02 -0.16542E+00 -0.31065E-02 -0.105E-03 1 - 38 6 75369.11 0.24494E+00 0.96700E-03 -0.19503E+00 -0.31065E-02 -0.105E-03 1 - 38 6 75369.11 0.24494E+00 0.96700E-03 -0.19503E+00 -0.31065E-02 -0.105E-03 1 - 38 6 75376.16 0.25177E+00 0.26791E-02 -0.21695E+00 -0.16311E-02 -0.105E-03 1 - 38 6 75376.16 0.25177E+00 0.26791E-02 -0.21695E+00 -0.16311E-02 -0.105E-03 1 - 38 6 75380.16 0.26248E+00 0.44642E-02 -0.22347E+00 -0.11138E-03 -0.105E-03 1 - 38 6 75380.16 0.26248E+00 0.44642E-02 -0.22347E+00 -0.11138E-03 -0.105E-03 1 - 38 6 75381.86 0.27007E+00 0.44645E-02 -0.22366E+00 -0.10982E-03 -0.105E-03 1 - 38 6 75381.86 0.27007E+00 0.44645E-02 -0.22366E+00 -0.10982E-03 -0.105E-03 1 - 38 6 75382.66 0.27364E+00 0.44648E-02 -0.22375E+00 -0.10824E-03 -0.105E-03 1 - 38 6 75382.66 0.27364E+00 0.44648E-02 -0.22375E+00 -0.10824E-03 -0.105E-03 1 - 38 6 75387.22 0.29398E+00 0.43939E-02 -0.22424E+00 -0.10824E-03 -0.105E-03 1 - 38 6 75387.22 0.29398E+00 0.43939E-02 -0.22424E+00 -0.10824E-03 -0.105E-03 1 - 38 6 75396.75 0.33587E+00 0.43230E-02 -0.22528E+00 -0.10824E-03 -0.105E-03 1 - 38 6 75396.75 0.33587E+00 0.43230E-02 -0.22528E+00 -0.10824E-03 -0.105E-03 1 - 38 6 75402.88 0.36236E+00 0.42521E-02 -0.22594E+00 -0.10824E-03 -0.105E-03 1 - 38 6 75402.88 0.36236E+00 0.42521E-02 -0.22594E+00 -0.10824E-03 -0.105E-03 1 - 38 6 75412.41 0.40289E+00 0.41811E-02 -0.22697E+00 -0.10824E-03 -0.105E-03 1 - 38 6 75412.41 0.40289E+00 0.41811E-02 -0.22697E+00 -0.10824E-03 -0.105E-03 1 - 38 6 75418.54 0.42851E+00 0.41102E-02 -0.22763E+00 -0.10824E-03 -0.105E-03 1 - 38 6 75418.54 0.42851E+00 0.41102E-02 -0.22763E+00 -0.10824E-03 -0.105E-03 1 - 38 6 75428.07 0.46770E+00 0.40393E-02 -0.22867E+00 -0.10824E-03 -0.105E-03 1 - 38 6 75428.07 0.46770E+00 0.40393E-02 -0.22867E+00 -0.10824E-03 -0.105E-03 1 - 38 6 75434.20 0.49244E+00 0.39684E-02 -0.22933E+00 -0.10824E-03 -0.105E-03 1 - 38 6 75434.20 0.49244E+00 0.39684E-02 -0.22933E+00 -0.10824E-03 -0.105E-03 1 - 38 6 75443.73 0.53028E+00 0.38975E-02 -0.23036E+00 -0.10824E-03 -0.105E-03 1 - 38 6 75443.73 0.53028E+00 0.38975E-02 -0.23036E+00 -0.10824E-03 -0.105E-03 1 - 38 6 75449.86 0.55416E+00 0.38265E-02 -0.23102E+00 -0.10824E-03 -0.105E-03 1 - 38 6 75449.86 0.55416E+00 0.38265E-02 -0.23102E+00 -0.10824E-03 -0.105E-03 1 - 38 6 75459.39 0.59064E+00 0.37556E-02 -0.23206E+00 -0.10824E-03 -0.105E-03 1 - 38 6 75459.39 0.59064E+00 0.37556E-02 -0.23206E+00 -0.10824E-03 -0.105E-03 1 - 38 6 75465.52 0.61365E+00 0.36847E-02 -0.23272E+00 -0.10824E-03 -0.105E-03 1 - 38 6 75465.52 0.61365E+00 0.36847E-02 -0.23272E+00 -0.10824E-03 -0.105E-03 1 - 38 6 75475.05 0.64877E+00 0.36138E-02 -0.23375E+00 -0.10824E-03 -0.105E-03 1 - 38 6 75475.05 0.64877E+00 0.36138E-02 -0.23375E+00 -0.10824E-03 -0.105E-03 1 - 38 6 75482.11 0.67427E+00 -0.99175E-03 -0.23451E+00 -0.17101E-02 -0.105E-03 1 - 38 6 75482.11 0.67427E+00 -0.99175E-03 -0.23451E+00 -0.17101E-02 -0.105E-03 1 - 38 6 75486.11 0.67030E+00 -0.55702E-02 -0.24135E+00 -0.33586E-02 -0.105E-03 1 - 38 6 75486.11 0.67030E+00 -0.55702E-02 -0.24135E+00 -0.33586E-02 -0.105E-03 1 - 38 6 75487.81 0.66083E+00 -0.55726E-02 -0.24706E+00 -0.33607E-02 -0.105E-03 1 - 38 6 75487.81 0.66083E+00 -0.55726E-02 -0.24706E+00 -0.33607E-02 -0.105E-03 1 - 38 6 75488.61 0.65638E+00 -0.55749E-02 -0.24975E+00 -0.33628E-02 -0.105E-03 1 - 38 6 75488.61 0.65638E+00 -0.55749E-02 -0.24975E+00 -0.33628E-02 -0.105E-03 1 - 38 6 75493.16 0.63098E+00 -0.56459E-02 -0.26507E+00 -0.33628E-02 -0.105E-03 1 - 38 6 75493.16 0.63098E+00 -0.56459E-02 -0.26507E+00 -0.33628E-02 -0.105E-03 1 - 38 6 75502.69 0.57715E+00 -0.57168E-02 -0.29713E+00 -0.33628E-02 -0.105E-03 1 - 38 6 75502.69 0.57715E+00 -0.57168E-02 -0.29713E+00 -0.33628E-02 -0.105E-03 1 - 38 6 75508.82 0.54213E+00 -0.57877E-02 -0.31773E+00 -0.33628E-02 -0.105E-03 1 - 38 6 75508.82 0.54213E+00 -0.57877E-02 -0.31773E+00 -0.33628E-02 -0.105E-03 1 - 38 6 75518.35 0.48695E+00 -0.58586E-02 -0.34979E+00 -0.33628E-02 -0.105E-03 1 - 38 6 75518.35 0.48695E+00 -0.58586E-02 -0.34979E+00 -0.33628E-02 -0.105E-03 1 - 38 6 75524.48 0.45106E+00 -0.59295E-02 -0.37040E+00 -0.33628E-02 -0.105E-03 1 - 38 6 75524.48 0.45106E+00 -0.59295E-02 -0.37040E+00 -0.33628E-02 -0.105E-03 1 - 38 6 75534.01 0.39453E+00 -0.60005E-02 -0.40245E+00 -0.33628E-02 -0.105E-03 1 - 38 6 75534.01 0.39453E+00 -0.60005E-02 -0.40245E+00 -0.33628E-02 -0.105E-03 1 - 38 6 75540.14 0.35777E+00 -0.60714E-02 -0.42306E+00 -0.33628E-02 -0.105E-03 1 - 38 6 75540.14 0.35777E+00 -0.60714E-02 -0.42306E+00 -0.33628E-02 -0.105E-03 1 - 38 6 75549.68 0.29989E+00 -0.61423E-02 -0.45512E+00 -0.33628E-02 -0.105E-03 1 - 38 6 75549.68 0.29989E+00 -0.61423E-02 -0.45512E+00 -0.33628E-02 -0.105E-03 1 - 38 6 75555.80 0.26225E+00 -0.62132E-02 -0.47572E+00 -0.33628E-02 -0.105E-03 1 - 38 6 75555.80 0.26225E+00 -0.62132E-02 -0.47572E+00 -0.33628E-02 -0.105E-03 1 - 38 6 75565.34 0.20302E+00 -0.62841E-02 -0.50778E+00 -0.33628E-02 -0.105E-03 1 - 38 6 75565.34 0.20302E+00 -0.62841E-02 -0.50778E+00 -0.33628E-02 -0.105E-03 1 - 38 6 75571.46 0.16452E+00 -0.63550E-02 -0.52838E+00 -0.33628E-02 -0.105E-03 1 - 38 6 75571.46 0.16452E+00 -0.63550E-02 -0.52838E+00 -0.33628E-02 -0.105E-03 1 - 38 6 75581.00 0.10394E+00 -0.64259E-02 -0.56044E+00 -0.33628E-02 -0.105E-03 1 - 38 6 75581.00 0.10394E+00 -0.64259E-02 -0.56044E+00 -0.33628E-02 -0.105E-03 1 - 38 6 75588.05 0.58597E-01 -0.60274E-02 -0.58417E+00 0.60982E-03 -0.105E-03 1 - 38 6 75588.05 0.58597E-01 -0.60274E-02 -0.58417E+00 0.60982E-03 -0.105E-03 1 - 38 6 75592.05 0.34488E-01 -0.57928E-02 -0.58173E+00 0.45658E-02 -0.105E-03 1 - 38 6 75592.05 0.34488E-01 -0.57928E-02 -0.58173E+00 0.45658E-02 -0.105E-03 1 - 38 6 75593.75 0.24640E-01 -0.57971E-02 -0.57396E+00 0.45662E-02 -0.105E-03 1 - 38 6 75593.75 0.24640E-01 -0.57971E-02 -0.57396E+00 0.45662E-02 -0.105E-03 1 - 38 6 75594.55 0.20002E-01 -0.58013E-02 -0.57031E+00 0.45665E-02 -0.105E-03 1 - 38 6 75594.55 0.20002E-01 -0.58013E-02 -0.57031E+00 0.45665E-02 -0.105E-03 1 - 38 6 75599.11 -0.64253E-02 -0.58722E-02 -0.54951E+00 0.45665E-02 -0.105E-03 1 - 38 6 75599.11 -0.64253E-02 -0.58722E-02 -0.54951E+00 0.45665E-02 -0.105E-03 1 - 38 6 75608.64 -0.62407E-01 -0.59430E-02 -0.50597E+00 0.45665E-02 -0.105E-03 1 - 38 6 75608.64 -0.62407E-01 -0.59430E-02 -0.50597E+00 0.45665E-02 -0.105E-03 1 - 38 6 75614.77 -0.98819E-01 -0.60139E-02 -0.47800E+00 0.45665E-02 -0.105E-03 1 - 38 6 75614.77 -0.98819E-01 -0.60139E-02 -0.47800E+00 0.45665E-02 -0.105E-03 1 - 38 6 75624.30 -0.15615E+00 -0.60848E-02 -0.43446E+00 0.45665E-02 -0.105E-03 1 - 38 6 75624.30 -0.15615E+00 -0.60848E-02 -0.43446E+00 0.45665E-02 -0.105E-03 1 - 38 6 75630.43 -0.19343E+00 -0.61557E-02 -0.40648E+00 0.45665E-02 -0.105E-03 1 - 38 6 75630.43 -0.19343E+00 -0.61557E-02 -0.40648E+00 0.45665E-02 -0.105E-03 1 - 38 6 75639.96 -0.25212E+00 -0.62265E-02 -0.36295E+00 0.45665E-02 -0.105E-03 1 - 38 6 75639.96 -0.25212E+00 -0.62265E-02 -0.36295E+00 0.45665E-02 -0.105E-03 1 - 38 6 75646.09 -0.29027E+00 -0.62974E-02 -0.33497E+00 0.45665E-02 -0.105E-03 1 - 38 6 75646.09 -0.29027E+00 -0.62974E-02 -0.33497E+00 0.45665E-02 -0.105E-03 1 - 38 6 75655.62 -0.35030E+00 -0.63683E-02 -0.29144E+00 0.45665E-02 -0.105E-03 1 - 38 6 75655.62 -0.35030E+00 -0.63683E-02 -0.29144E+00 0.45665E-02 -0.105E-03 1 - 38 6 75661.75 -0.38932E+00 -0.64391E-02 -0.26346E+00 0.45665E-02 -0.105E-03 1 - 38 6 75661.75 -0.38932E+00 -0.64391E-02 -0.26346E+00 0.45665E-02 -0.105E-03 1 - 38 6 75671.28 -0.45070E+00 -0.65100E-02 -0.21993E+00 0.45665E-02 -0.105E-03 1 - 38 6 75671.28 -0.45070E+00 -0.65100E-02 -0.21993E+00 0.45665E-02 -0.105E-03 1 - 38 6 75677.41 -0.49059E+00 -0.65809E-02 -0.19195E+00 0.45665E-02 -0.105E-03 1 - 38 6 75677.41 -0.49059E+00 -0.65809E-02 -0.19195E+00 0.45665E-02 -0.105E-03 1 - 38 6 75686.94 -0.55333E+00 -0.66517E-02 -0.14841E+00 0.45665E-02 -0.105E-03 1 - 38 6 75686.94 -0.55333E+00 -0.66517E-02 -0.14841E+00 0.45665E-02 -0.105E-03 1 - 38 6 75694.00 -0.60026E+00 -0.25517E-02 -0.11619E+00 0.37728E-02 -0.105E-03 1 - 38 6 75694.00 -0.60026E+00 -0.25517E-02 -0.11619E+00 0.37728E-02 -0.105E-03 1 - 38 6 75698.00 -0.61047E+00 0.16180E-02 -0.10110E+00 0.30823E-02 -0.105E-03 1 - 38 6 75698.00 -0.61047E+00 0.16180E-02 -0.10110E+00 0.30823E-02 -0.105E-03 1 - 38 6 75699.70 -0.60772E+00 0.16157E-02 -0.95864E-01 0.30830E-02 -0.105E-03 1 - 38 6 75699.70 -0.60772E+00 0.16157E-02 -0.95864E-01 0.30830E-02 -0.105E-03 1 - 38 6 75700.50 -0.60642E+00 0.16134E-02 -0.93397E-01 0.30837E-02 -0.105E-03 1 - 38 6 75700.50 -0.60642E+00 0.16134E-02 -0.93397E-01 0.30837E-02 -0.105E-03 1 - 38 6 75705.05 -0.59907E+00 0.15425E-02 -0.79349E-01 0.30837E-02 -0.105E-03 1 - 38 6 75705.05 -0.59907E+00 0.15425E-02 -0.79349E-01 0.30837E-02 -0.105E-03 1 - 38 6 75714.58 -0.58437E+00 0.14717E-02 -0.49951E-01 0.30837E-02 -0.105E-03 1 - 38 6 75714.58 -0.58437E+00 0.14717E-02 -0.49951E-01 0.30837E-02 -0.105E-03 1 - 38 6 75720.71 -0.57535E+00 0.14008E-02 -0.31057E-01 0.30837E-02 -0.105E-03 1 - 38 6 75720.71 -0.57535E+00 0.14008E-02 -0.31057E-01 0.30837E-02 -0.105E-03 1 - 38 6 75730.25 -0.56200E+00 0.13300E-02 -0.16590E-02 0.30837E-02 -0.105E-03 1 - 38 6 75730.25 -0.56200E+00 0.13300E-02 -0.16590E-02 0.30837E-02 -0.105E-03 1 - 38 6 75736.37 -0.55385E+00 0.12591E-02 0.17235E-01 0.30837E-02 -0.105E-03 1 - 38 6 75736.37 -0.55385E+00 0.12591E-02 0.17235E-01 0.30837E-02 -0.105E-03 1 - 38 6 75745.91 -0.54184E+00 0.11883E-02 0.46633E-01 0.30837E-02 -0.105E-03 1 - 38 6 75745.91 -0.54184E+00 0.11883E-02 0.46633E-01 0.30837E-02 -0.105E-03 1 - 38 6 75752.03 -0.53456E+00 0.11174E-02 0.65526E-01 0.30837E-02 -0.105E-03 1 - 38 6 75752.03 -0.53456E+00 0.11174E-02 0.65526E-01 0.30837E-02 -0.105E-03 1 - 38 6 75761.57 -0.52391E+00 0.10466E-02 0.94925E-01 0.30837E-02 -0.105E-03 1 - 38 6 75761.57 -0.52391E+00 0.10466E-02 0.94925E-01 0.30837E-02 -0.105E-03 1 - 38 6 75767.69 -0.51750E+00 0.97572E-03 0.11382E+00 0.30837E-02 -0.105E-03 1 - 38 6 75767.69 -0.51750E+00 0.97572E-03 0.11382E+00 0.30837E-02 -0.105E-03 1 - 38 6 75777.23 -0.50820E+00 0.90486E-03 0.14322E+00 0.30837E-02 -0.105E-03 1 - 38 6 75777.23 -0.50820E+00 0.90486E-03 0.14322E+00 0.30837E-02 -0.105E-03 1 - 38 6 75783.35 -0.50265E+00 0.83400E-03 0.16211E+00 0.30837E-02 -0.105E-03 1 - 38 6 75783.35 -0.50265E+00 0.83400E-03 0.16211E+00 0.30837E-02 -0.105E-03 1 - 38 6 75792.89 -0.49470E+00 0.76315E-03 0.19151E+00 0.30837E-02 -0.105E-03 1 - 38 6 75792.89 -0.49470E+00 0.76315E-03 0.19151E+00 0.30837E-02 -0.105E-03 1 - 38 6 75799.94 -0.48932E+00 -0.25644E-02 0.21327E+00 0.16334E-02 -0.105E-03 1 - 38 6 75799.94 -0.48932E+00 -0.25644E-02 0.21327E+00 0.16334E-02 -0.105E-03 1 - 38 6 75803.94 -0.49958E+00 -0.59618E-02 0.21980E+00 0.13869E-03 -0.105E-03 1 - 38 6 75803.94 -0.49958E+00 -0.59618E-02 0.21980E+00 0.13869E-03 -0.105E-03 1 - 38 6 75805.64 -0.50971E+00 -0.59591E-02 0.22004E+00 0.14158E-03 -0.105E-03 1 - 38 6 75805.64 -0.50971E+00 -0.59591E-02 0.22004E+00 0.14158E-03 -0.105E-03 1 - 38 6 75806.44 -0.51448E+00 -0.59563E-02 0.22015E+00 0.14450E-03 -0.105E-03 1 - 38 6 75806.44 -0.51448E+00 -0.59563E-02 0.22015E+00 0.14450E-03 -0.105E-03 1 - 38 6 75811.00 -0.54161E+00 -0.60271E-02 0.22081E+00 0.14450E-03 -0.105E-03 1 - 38 6 75811.00 -0.54161E+00 -0.60271E-02 0.22081E+00 0.14450E-03 -0.105E-03 1 - 38 6 75820.53 -0.59907E+00 -0.60980E-02 0.22218E+00 0.14450E-03 -0.105E-03 1 - 38 6 75820.53 -0.59907E+00 -0.60980E-02 0.22218E+00 0.14450E-03 -0.105E-03 1 - 38 6 75826.66 -0.63643E+00 -0.61688E-02 0.22307E+00 0.14450E-03 -0.105E-03 1 - 38 6 75826.66 -0.63643E+00 -0.61688E-02 0.22307E+00 0.14450E-03 -0.105E-03 1 - 38 6 75836.19 -0.69524E+00 -0.62397E-02 0.22445E+00 0.14450E-03 -0.105E-03 1 - 38 6 75836.19 -0.69524E+00 -0.62397E-02 0.22445E+00 0.14450E-03 -0.105E-03 1 - 38 6 75842.32 -0.73347E+00 -0.63105E-02 0.22533E+00 0.14450E-03 -0.105E-03 1 - 38 6 75842.32 -0.73347E+00 -0.63105E-02 0.22533E+00 0.14450E-03 -0.105E-03 1 - 38 6 75851.85 -0.79363E+00 -0.63814E-02 0.22671E+00 0.14450E-03 -0.105E-03 1 - 38 6 75851.85 -0.79363E+00 -0.63814E-02 0.22671E+00 0.14450E-03 -0.105E-03 1 - 38 6 75857.98 -0.83273E+00 -0.64522E-02 0.22760E+00 0.14450E-03 -0.105E-03 1 - 38 6 75857.98 -0.83273E+00 -0.64522E-02 0.22760E+00 0.14450E-03 -0.105E-03 1 - 38 6 75867.51 -0.89424E+00 -0.65230E-02 0.22897E+00 0.14450E-03 -0.105E-03 1 - 38 6 75867.51 -0.89424E+00 -0.65230E-02 0.22897E+00 0.14450E-03 -0.105E-03 1 - 38 6 75873.64 -0.93420E+00 -0.65939E-02 0.22986E+00 0.14450E-03 -0.105E-03 1 - 38 6 75873.64 -0.93420E+00 -0.65939E-02 0.22986E+00 0.14450E-03 -0.105E-03 1 - 38 6 75883.17 -0.99707E+00 -0.66647E-02 0.23124E+00 0.14450E-03 -0.105E-03 1 - 38 6 75883.17 -0.99707E+00 -0.66647E-02 0.23124E+00 0.14450E-03 -0.105E-03 1 - 38 6 75889.30 -0.10379E+01 -0.67355E-02 0.23212E+00 0.14450E-03 -0.105E-03 1 - 38 6 75889.30 -0.10379E+01 -0.67355E-02 0.23212E+00 0.14450E-03 -0.105E-03 1 - 38 6 75898.83 -0.11021E+01 -0.68063E-02 0.23350E+00 0.14450E-03 -0.105E-03 1 - 38 6 75898.83 -0.11021E+01 -0.68063E-02 0.23350E+00 0.14450E-03 -0.105E-03 1 - 38 6 75905.89 -0.11501E+01 0.10495E-02 0.23452E+00 0.17463E-02 -0.105E-03 1 - 38 6 75905.89 -0.11501E+01 0.10495E-02 0.23452E+00 0.17463E-02 -0.105E-03 1 - 38 6 75909.89 -0.11459E+01 0.88767E-02 0.24150E+00 0.33959E-02 -0.105E-03 1 - 38 6 75909.89 -0.11459E+01 0.88767E-02 0.24150E+00 0.33959E-02 -0.105E-03 1 - 38 6 75911.59 -0.11308E+01 0.88689E-02 0.24728E+00 0.33923E-02 -0.105E-03 1 - 38 6 75911.59 -0.11308E+01 0.88689E-02 0.24728E+00 0.33923E-02 -0.105E-03 1 - 38 6 75912.39 -0.11237E+01 0.88612E-02 0.24999E+00 0.33887E-02 -0.105E-03 1 - 38 6 75912.39 -0.11237E+01 0.88612E-02 0.24999E+00 0.33887E-02 -0.105E-03 1 - 38 6 75916.94 -0.10834E+01 0.87904E-02 0.26543E+00 0.33887E-02 -0.105E-03 1 - 38 6 75916.94 -0.10834E+01 0.87904E-02 0.26543E+00 0.33887E-02 -0.105E-03 1 - 38 6 75926.48 -0.99958E+00 0.87196E-02 0.29773E+00 0.33887E-02 -0.105E-03 1 - 38 6 75926.48 -0.99958E+00 0.87196E-02 0.29773E+00 0.33887E-02 -0.105E-03 1 - 38 6 75932.60 -0.94616E+00 0.86487E-02 0.31850E+00 0.33887E-02 -0.105E-03 1 - 38 6 75932.60 -0.94616E+00 0.86487E-02 0.31850E+00 0.33887E-02 -0.105E-03 1 - 38 6 75942.14 -0.86371E+00 0.85779E-02 0.35080E+00 0.33887E-02 -0.105E-03 1 - 38 6 75942.14 -0.86371E+00 0.85779E-02 0.35080E+00 0.33887E-02 -0.105E-03 1 - 38 6 75948.26 -0.81115E+00 0.85071E-02 0.37156E+00 0.33887E-02 -0.105E-03 1 - 38 6 75948.26 -0.81115E+00 0.85071E-02 0.37156E+00 0.33887E-02 -0.105E-03 1 - 38 6 75957.80 -0.73005E+00 0.84362E-02 0.40387E+00 0.33887E-02 -0.105E-03 1 - 38 6 75957.80 -0.73005E+00 0.84362E-02 0.40387E+00 0.33887E-02 -0.105E-03 1 - 38 6 75963.92 -0.67836E+00 0.83654E-02 0.42463E+00 0.33887E-02 -0.105E-03 1 - 38 6 75963.92 -0.67836E+00 0.83654E-02 0.42463E+00 0.33887E-02 -0.105E-03 1 - 38 6 75973.46 -0.59861E+00 0.82945E-02 0.45694E+00 0.33887E-02 -0.105E-03 1 - 38 6 75973.46 -0.59861E+00 0.82945E-02 0.45694E+00 0.33887E-02 -0.105E-03 1 - 38 6 75979.58 -0.54779E+00 0.82237E-02 0.47770E+00 0.33887E-02 -0.105E-03 1 - 38 6 75979.58 -0.54779E+00 0.82237E-02 0.47770E+00 0.33887E-02 -0.105E-03 1 - 38 6 75989.12 -0.46939E+00 0.81528E-02 0.51001E+00 0.33887E-02 -0.105E-03 1 - 38 6 75989.12 -0.46939E+00 0.81528E-02 0.51001E+00 0.33887E-02 -0.105E-03 1 - 38 6 75995.24 -0.41944E+00 0.80820E-02 0.53077E+00 0.33887E-02 -0.105E-03 1 - 38 6 75995.24 -0.41944E+00 0.80820E-02 0.53077E+00 0.33887E-02 -0.105E-03 1 - 38 6 76004.78 -0.34239E+00 0.80111E-02 0.56307E+00 0.33887E-02 -0.105E-03 1 - 38 6 76004.78 -0.34239E+00 0.80111E-02 0.56307E+00 0.33887E-02 -0.105E-03 1 - 38 6 76011.83 -0.28587E+00 0.60670E-02 0.58698E+00 -0.60304E-03 -0.105E-03 1 - 38 6 76011.83 -0.28587E+00 0.60670E-02 0.58698E+00 -0.60304E-03 -0.105E-03 1 - 38 6 76015.83 -0.26160E+00 0.42880E-02 0.58457E+00 -0.45784E-02 -0.105E-03 1 - 38 6 76015.83 -0.26160E+00 0.42880E-02 0.58457E+00 -0.45784E-02 -0.105E-03 1 - 38 6 76017.53 -0.25431E+00 0.42845E-02 0.57679E+00 -0.45746E-02 -0.105E-03 1 - 38 6 76017.53 -0.25431E+00 0.42845E-02 0.57679E+00 -0.45746E-02 -0.105E-03 1 - 38 6 76018.33 -0.25089E+00 0.42811E-02 0.57313E+00 -0.45709E-02 -0.105E-03 1 - 38 6 76018.33 -0.25089E+00 0.42811E-02 0.57313E+00 -0.45709E-02 -0.105E-03 1 - 38 6 76022.89 -0.23138E+00 0.42102E-02 0.55231E+00 -0.45709E-02 -0.105E-03 1 - 38 6 76022.89 -0.23138E+00 0.42102E-02 0.55231E+00 -0.45709E-02 -0.105E-03 1 - 38 6 76032.42 -0.19125E+00 0.41394E-02 0.50873E+00 -0.45709E-02 -0.105E-03 1 - 38 6 76032.42 -0.19125E+00 0.41394E-02 0.50873E+00 -0.45709E-02 -0.105E-03 1 - 38 6 76038.55 -0.16589E+00 0.40685E-02 0.48072E+00 -0.45709E-02 -0.105E-03 1 - 38 6 76038.55 -0.16589E+00 0.40685E-02 0.48072E+00 -0.45709E-02 -0.105E-03 1 - 38 6 76048.08 -0.12710E+00 0.39976E-02 0.43715E+00 -0.45709E-02 -0.105E-03 1 - 38 6 76048.08 -0.12710E+00 0.39976E-02 0.43715E+00 -0.45709E-02 -0.105E-03 1 - 38 6 76054.21 -0.10261E+00 0.39267E-02 0.40914E+00 -0.45709E-02 -0.105E-03 1 - 38 6 76054.21 -0.10261E+00 0.39267E-02 0.40914E+00 -0.45709E-02 -0.105E-03 1 - 38 6 76063.74 -0.65171E-01 0.38558E-02 0.36557E+00 -0.45709E-02 -0.105E-03 1 - 38 6 76063.74 -0.65171E-01 0.38558E-02 0.36557E+00 -0.45709E-02 -0.105E-03 1 - 38 6 76069.87 -0.41547E-01 0.37850E-02 0.33756E+00 -0.45709E-02 -0.105E-03 1 - 38 6 76069.87 -0.41547E-01 0.37850E-02 0.33756E+00 -0.45709E-02 -0.105E-03 1 - 38 6 76079.40 -0.54639E-02 0.37141E-02 0.29399E+00 -0.45709E-02 -0.105E-03 1 - 38 6 76079.40 -0.54639E-02 0.37141E-02 0.29399E+00 -0.45709E-02 -0.105E-03 1 - 38 6 76085.53 0.17292E-01 0.36432E-02 0.26598E+00 -0.45709E-02 -0.105E-03 1 - 38 6 76085.53 0.17292E-01 0.36432E-02 0.26598E+00 -0.45709E-02 -0.105E-03 1 - 38 6 76095.06 0.52023E-01 0.35723E-02 0.22240E+00 -0.45709E-02 -0.105E-03 1 - 38 6 76095.06 0.52023E-01 0.35723E-02 0.22240E+00 -0.45709E-02 -0.105E-03 1 - 38 6 76101.19 0.73910E-01 0.35014E-02 0.19440E+00 -0.45709E-02 -0.105E-03 1 - 38 6 76101.19 0.73910E-01 0.35014E-02 0.19440E+00 -0.45709E-02 -0.105E-03 1 - 38 6 76110.72 0.10729E+00 0.34305E-02 0.15082E+00 -0.45709E-02 -0.105E-03 1 - 38 6 76110.72 0.10729E+00 0.34305E-02 0.15082E+00 -0.45709E-02 -0.105E-03 1 - 38 6 76117.78 0.13149E+00 0.25324E-02 0.11857E+00 -0.37610E-02 -0.105E-03 1 - 38 6 76117.78 0.13149E+00 0.25324E-02 0.11857E+00 -0.37610E-02 -0.105E-03 1 - 38 6 76121.78 0.14162E+00 0.15650E-02 0.10353E+00 -0.30539E-02 -0.105E-03 1 - 38 6 76121.78 0.14162E+00 0.15650E-02 0.10353E+00 -0.30539E-02 -0.105E-03 1 - 38 6 76123.48 0.14428E+00 0.15649E-02 0.98337E-01 -0.30537E-02 -0.105E-03 1 - 38 6 76123.48 0.14428E+00 0.15649E-02 0.98337E-01 -0.30537E-02 -0.105E-03 1 - 38 6 76124.28 0.14554E+00 0.15649E-02 0.95894E-01 -0.30535E-02 -0.105E-03 1 - 38 6 76124.28 0.14554E+00 0.15649E-02 0.95894E-01 -0.30535E-02 -0.105E-03 1 - 38 6 76128.83 0.15266E+00 0.14940E-02 0.81983E-01 -0.30535E-02 -0.105E-03 1 - 38 6 76128.83 0.15266E+00 0.14940E-02 0.81983E-01 -0.30535E-02 -0.105E-03 1 - 38 6 76138.37 0.16691E+00 0.14231E-02 0.52873E-01 -0.30535E-02 -0.105E-03 1 - 38 6 76138.37 0.16691E+00 0.14231E-02 0.52873E-01 -0.30535E-02 -0.105E-03 1 - 38 6 76144.49 0.17563E+00 0.13522E-02 0.34165E-01 -0.30535E-02 -0.105E-03 1 - 38 6 76144.49 0.17563E+00 0.13522E-02 0.34165E-01 -0.30535E-02 -0.105E-03 1 - 38 6 76154.03 0.18852E+00 0.12813E-02 0.50544E-02 -0.30535E-02 -0.105E-03 1 - 38 6 76154.03 0.18852E+00 0.12813E-02 0.50544E-02 -0.30535E-02 -0.105E-03 1 - 38 6 76160.15 0.19637E+00 0.12104E-02 -0.13654E-01 -0.30535E-02 -0.105E-03 1 - 38 6 76160.15 0.19637E+00 0.12104E-02 -0.13654E-01 -0.30535E-02 -0.105E-03 1 - 38 6 76169.69 0.20791E+00 0.11395E-02 -0.42764E-01 -0.30535E-02 -0.105E-03 1 - 38 6 76169.69 0.20791E+00 0.11395E-02 -0.42764E-01 -0.30535E-02 -0.105E-03 1 - 38 6 76175.81 0.21489E+00 0.10686E-02 -0.61473E-01 -0.30535E-02 -0.105E-03 1 - 38 6 76175.81 0.21489E+00 0.10686E-02 -0.61473E-01 -0.30535E-02 -0.105E-03 1 - 38 6 76185.35 0.22507E+00 0.99767E-03 -0.90583E-01 -0.30535E-02 -0.105E-03 1 - 38 6 76185.35 0.22507E+00 0.99767E-03 -0.90583E-01 -0.30535E-02 -0.105E-03 1 - 38 6 76191.47 0.23119E+00 0.92676E-03 -0.10929E+00 -0.30535E-02 -0.105E-03 1 - 38 6 76191.47 0.23119E+00 0.92676E-03 -0.10929E+00 -0.30535E-02 -0.105E-03 1 - 38 6 76201.01 0.24002E+00 0.85586E-03 -0.13840E+00 -0.30535E-02 -0.105E-03 1 - 38 6 76201.01 0.24002E+00 0.85586E-03 -0.13840E+00 -0.30535E-02 -0.105E-03 1 - 38 6 76207.13 0.24527E+00 0.78496E-03 -0.15711E+00 -0.30535E-02 -0.105E-03 1 - 38 6 76207.13 0.24527E+00 0.78496E-03 -0.15711E+00 -0.30535E-02 -0.105E-03 1 - 38 6 76216.67 0.25275E+00 0.71405E-03 -0.18622E+00 -0.30535E-02 -0.105E-03 1 - 38 6 76216.67 0.25275E+00 0.71405E-03 -0.18622E+00 -0.30535E-02 -0.105E-03 1 - 38 6 76223.72 0.25779E+00 0.24671E-02 -0.20776E+00 -0.16406E-02 -0.105E-03 1 - 38 6 76223.72 0.25779E+00 0.24671E-02 -0.20776E+00 -0.16406E-02 -0.105E-03 1 - 38 6 76227.72 0.26766E+00 0.42873E-02 -0.21433E+00 -0.18310E-03 -0.105E-03 1 - 38 6 76227.72 0.26766E+00 0.42873E-02 -0.21433E+00 -0.18310E-03 -0.105E-03 1 - 38 6 76229.42 0.27494E+00 0.42877E-02 -0.21464E+00 -0.18158E-03 -0.105E-03 1 - 38 6 76229.42 0.27494E+00 0.42877E-02 -0.21464E+00 -0.18158E-03 -0.105E-03 1 - 38 6 76230.22 0.27837E+00 0.42881E-02 -0.21478E+00 -0.18003E-03 -0.105E-03 1 - 38 6 76230.22 0.27837E+00 0.42881E-02 -0.21478E+00 -0.18003E-03 -0.105E-03 1 - 38 6 76234.78 0.29791E+00 0.42172E-02 -0.21560E+00 -0.18003E-03 -0.105E-03 1 - 38 6 76234.78 0.29791E+00 0.42172E-02 -0.21560E+00 -0.18003E-03 -0.105E-03 1 - 38 6 76244.31 0.33811E+00 0.41463E-02 -0.21732E+00 -0.18003E-03 -0.105E-03 1 - 38 6 76244.31 0.33811E+00 0.41463E-02 -0.21732E+00 -0.18003E-03 -0.105E-03 1 - 38 6 76250.44 0.36352E+00 0.40754E-02 -0.21842E+00 -0.18003E-03 -0.105E-03 1 - 38 6 76250.44 0.36352E+00 0.40754E-02 -0.21842E+00 -0.18003E-03 -0.105E-03 1 - 38 6 76259.97 0.40237E+00 0.40045E-02 -0.22014E+00 -0.18003E-03 -0.105E-03 1 - 38 6 76259.97 0.40237E+00 0.40045E-02 -0.22014E+00 -0.18003E-03 -0.105E-03 1 - 38 6 76266.10 0.42690E+00 0.39335E-02 -0.22124E+00 -0.18003E-03 -0.105E-03 1 - 38 6 76266.10 0.42690E+00 0.39335E-02 -0.22124E+00 -0.18003E-03 -0.105E-03 1 - 38 6 76275.63 0.46440E+00 0.38626E-02 -0.22296E+00 -0.18003E-03 -0.105E-03 1 - 38 6 76275.63 0.46440E+00 0.38626E-02 -0.22296E+00 -0.18003E-03 -0.105E-03 1 - 38 6 76281.76 0.48807E+00 0.37917E-02 -0.22406E+00 -0.18003E-03 -0.105E-03 1 - 38 6 76281.76 0.48807E+00 0.37917E-02 -0.22406E+00 -0.18003E-03 -0.105E-03 1 - 38 6 76291.29 0.52422E+00 0.37208E-02 -0.22578E+00 -0.18003E-03 -0.105E-03 1 - 38 6 76291.29 0.52422E+00 0.37208E-02 -0.22578E+00 -0.18003E-03 -0.105E-03 1 - 38 6 76297.42 0.54701E+00 0.36499E-02 -0.22688E+00 -0.18003E-03 -0.105E-03 1 - 38 6 76297.42 0.54701E+00 0.36499E-02 -0.22688E+00 -0.18003E-03 -0.105E-03 1 - 38 6 76306.95 0.58181E+00 0.35789E-02 -0.22860E+00 -0.18003E-03 -0.105E-03 1 - 38 6 76306.95 0.58181E+00 0.35789E-02 -0.22860E+00 -0.18003E-03 -0.105E-03 1 - 38 6 76313.08 0.60374E+00 0.35080E-02 -0.22970E+00 -0.18003E-03 -0.105E-03 1 - 38 6 76313.08 0.60374E+00 0.35080E-02 -0.22970E+00 -0.18003E-03 -0.105E-03 1 - 38 6 76322.61 0.63718E+00 0.34371E-02 -0.23142E+00 -0.18003E-03 -0.105E-03 1 - 38 6 76322.61 0.63718E+00 0.34371E-02 -0.23142E+00 -0.18003E-03 -0.105E-03 1 - 38 6 76329.67 0.66143E+00 -0.10807E-02 -0.23269E+00 -0.17694E-02 -0.105E-03 1 - 38 6 76329.67 0.66143E+00 -0.10807E-02 -0.23269E+00 -0.17694E-02 -0.105E-03 1 - 38 6 76333.67 0.65711E+00 -0.55690E-02 -0.23976E+00 -0.34071E-02 -0.105E-03 1 - 38 6 76333.67 0.65711E+00 -0.55690E-02 -0.23976E+00 -0.34071E-02 -0.105E-03 1 - 38 6 76335.37 0.64764E+00 -0.55713E-02 -0.24556E+00 -0.34091E-02 -0.105E-03 1 - 38 6 76335.37 0.64764E+00 -0.55713E-02 -0.24556E+00 -0.34091E-02 -0.105E-03 1 - 38 6 76336.17 0.64318E+00 -0.55736E-02 -0.24828E+00 -0.34111E-02 -0.105E-03 1 - 38 6 76336.17 0.64318E+00 -0.55736E-02 -0.24828E+00 -0.34111E-02 -0.105E-03 1 - 38 6 76340.72 0.61779E+00 -0.56445E-02 -0.26382E+00 -0.34111E-02 -0.105E-03 1 - 38 6 76340.72 0.61779E+00 -0.56445E-02 -0.26382E+00 -0.34111E-02 -0.105E-03 1 - 38 6 76350.26 0.56398E+00 -0.57154E-02 -0.29634E+00 -0.34111E-02 -0.105E-03 1 - 38 6 76350.26 0.56398E+00 -0.57154E-02 -0.29634E+00 -0.34111E-02 -0.105E-03 1 - 38 6 76356.38 0.52896E+00 -0.57863E-02 -0.31724E+00 -0.34111E-02 -0.105E-03 1 - 38 6 76356.38 0.52896E+00 -0.57863E-02 -0.31724E+00 -0.34111E-02 -0.105E-03 1 - 38 6 76365.92 0.47380E+00 -0.58572E-02 -0.34976E+00 -0.34111E-02 -0.105E-03 1 - 38 6 76365.92 0.47380E+00 -0.58572E-02 -0.34976E+00 -0.34111E-02 -0.105E-03 1 - 38 6 76372.04 0.43791E+00 -0.59282E-02 -0.37066E+00 -0.34111E-02 -0.105E-03 1 - 38 6 76372.04 0.43791E+00 -0.59282E-02 -0.37066E+00 -0.34111E-02 -0.105E-03 1 - 38 6 76381.58 0.38140E+00 -0.59991E-02 -0.40318E+00 -0.34111E-02 -0.105E-03 1 - 38 6 76381.58 0.38140E+00 -0.59991E-02 -0.40318E+00 -0.34111E-02 -0.105E-03 1 - 38 6 76387.70 0.34464E+00 -0.60700E-02 -0.42408E+00 -0.34111E-02 -0.105E-03 1 - 38 6 76387.70 0.34464E+00 -0.60700E-02 -0.42408E+00 -0.34111E-02 -0.105E-03 1 - 38 6 76397.24 0.28678E+00 -0.61409E-02 -0.45660E+00 -0.34111E-02 -0.105E-03 1 - 38 6 76397.24 0.28678E+00 -0.61409E-02 -0.45660E+00 -0.34111E-02 -0.105E-03 1 - 38 6 76403.36 0.24915E+00 -0.62118E-02 -0.47750E+00 -0.34111E-02 -0.105E-03 1 - 38 6 76403.36 0.24915E+00 -0.62118E-02 -0.47750E+00 -0.34111E-02 -0.105E-03 1 - 38 6 76412.90 0.18993E+00 -0.62827E-02 -0.51002E+00 -0.34111E-02 -0.105E-03 1 - 38 6 76412.90 0.18993E+00 -0.62827E-02 -0.51002E+00 -0.34111E-02 -0.105E-03 1 - 38 6 76419.02 0.15144E+00 -0.63536E-02 -0.53092E+00 -0.34111E-02 -0.105E-03 1 - 38 6 76419.02 0.15144E+00 -0.63536E-02 -0.53092E+00 -0.34111E-02 -0.105E-03 1 - 38 6 76428.56 0.90869E-01 -0.64245E-02 -0.56344E+00 -0.34111E-02 -0.105E-03 1 - 38 6 76428.56 0.90869E-01 -0.64245E-02 -0.56344E+00 -0.34111E-02 -0.105E-03 1 - 38 6 76435.61 0.45541E-01 -0.61148E-02 -0.58751E+00 0.58418E-03 -0.105E-03 1 - 38 6 76435.61 0.45541E-01 -0.61148E-02 -0.58751E+00 0.58418E-03 -0.105E-03 1 - 38 6 76439.61 0.21082E-01 -0.59714E-02 -0.58517E+00 0.45636E-02 -0.105E-03 1 - 38 6 76439.61 0.21082E-01 -0.59714E-02 -0.58517E+00 0.45636E-02 -0.105E-03 1 - 38 6 76441.31 0.10931E-01 -0.59757E-02 -0.57741E+00 0.45638E-02 -0.105E-03 1 - 38 6 76441.31 0.10931E-01 -0.59757E-02 -0.57741E+00 0.45638E-02 -0.105E-03 1 - 38 6 76442.11 0.61504E-02 -0.59799E-02 -0.57376E+00 0.45639E-02 -0.105E-03 1 - 38 6 76442.11 0.61504E-02 -0.59799E-02 -0.57376E+00 0.45639E-02 -0.105E-03 1 - 38 6 76446.67 -0.21091E-01 -0.60508E-02 -0.55297E+00 0.45639E-02 -0.105E-03 1 - 38 6 76446.67 -0.21091E-01 -0.60508E-02 -0.55297E+00 0.45639E-02 -0.105E-03 1 - 38 6 76456.20 -0.78776E-01 -0.61217E-02 -0.50946E+00 0.45639E-02 -0.105E-03 1 - 38 6 76456.20 -0.78776E-01 -0.61217E-02 -0.50946E+00 0.45639E-02 -0.105E-03 1 - 38 6 76462.33 -0.11628E+00 -0.61926E-02 -0.48150E+00 0.45639E-02 -0.105E-03 1 - 38 6 76462.33 -0.11628E+00 -0.61926E-02 -0.48150E+00 0.45639E-02 -0.105E-03 1 - 38 6 76471.86 -0.17532E+00 -0.62635E-02 -0.43799E+00 0.45639E-02 -0.105E-03 1 - 38 6 76471.86 -0.17532E+00 -0.62635E-02 -0.43799E+00 0.45639E-02 -0.105E-03 1 - 38 6 76477.99 -0.21369E+00 -0.63343E-02 -0.41003E+00 0.45639E-02 -0.105E-03 1 - 38 6 76477.99 -0.21369E+00 -0.63343E-02 -0.41003E+00 0.45639E-02 -0.105E-03 1 - 38 6 76487.52 -0.27408E+00 -0.64052E-02 -0.36652E+00 0.45639E-02 -0.105E-03 1 - 38 6 76487.52 -0.27408E+00 -0.64052E-02 -0.36652E+00 0.45639E-02 -0.105E-03 1 - 38 6 76493.65 -0.31333E+00 -0.64761E-02 -0.33856E+00 0.45639E-02 -0.105E-03 1 - 38 6 76493.65 -0.31333E+00 -0.64761E-02 -0.33856E+00 0.45639E-02 -0.105E-03 1 - 38 6 76503.18 -0.37506E+00 -0.65470E-02 -0.29505E+00 0.45639E-02 -0.105E-03 1 - 38 6 76503.18 -0.37506E+00 -0.65470E-02 -0.29505E+00 0.45639E-02 -0.105E-03 1 - 38 6 76509.31 -0.41518E+00 -0.66178E-02 -0.26709E+00 0.45639E-02 -0.105E-03 1 - 38 6 76509.31 -0.41518E+00 -0.66178E-02 -0.26709E+00 0.45639E-02 -0.105E-03 1 - 38 6 76518.84 -0.47827E+00 -0.66887E-02 -0.22358E+00 0.45639E-02 -0.105E-03 1 - 38 6 76518.84 -0.47827E+00 -0.66887E-02 -0.22358E+00 0.45639E-02 -0.105E-03 1 - 38 6 76524.97 -0.51925E+00 -0.67595E-02 -0.19561E+00 0.45639E-02 -0.105E-03 1 - 38 6 76524.97 -0.51925E+00 -0.67595E-02 -0.19561E+00 0.45639E-02 -0.105E-03 1 - 38 6 76534.50 -0.58369E+00 -0.68304E-02 -0.15211E+00 0.45639E-02 -0.105E-03 1 - 38 6 76534.50 -0.58369E+00 -0.68304E-02 -0.15211E+00 0.45639E-02 -0.105E-03 1 - 38 6 76541.56 -0.63188E+00 -0.25144E-02 -0.11990E+00 0.37449E-02 -0.105E-03 1 - 38 6 76541.56 -0.63188E+00 -0.25144E-02 -0.11990E+00 0.37449E-02 -0.105E-03 1 - 38 6 76545.56 -0.64194E+00 0.18703E-02 -0.10493E+00 0.30282E-02 -0.105E-03 1 - 38 6 76545.56 -0.64194E+00 0.18703E-02 -0.10493E+00 0.30282E-02 -0.105E-03 1 - 38 6 76547.26 -0.63876E+00 0.18677E-02 -0.99777E-01 0.30290E-02 -0.105E-03 1 - 38 6 76547.26 -0.63876E+00 0.18677E-02 -0.99777E-01 0.30290E-02 -0.105E-03 1 - 38 6 76548.06 -0.63726E+00 0.18652E-02 -0.97354E-01 0.30298E-02 -0.105E-03 1 - 38 6 76548.06 -0.63726E+00 0.18652E-02 -0.97354E-01 0.30298E-02 -0.105E-03 1 - 38 6 76552.61 -0.62877E+00 0.17943E-02 -0.83552E-01 0.30298E-02 -0.105E-03 1 - 38 6 76552.61 -0.62877E+00 0.17943E-02 -0.83552E-01 0.30298E-02 -0.105E-03 1 - 38 6 76562.15 -0.61166E+00 0.17235E-02 -0.54668E-01 0.30298E-02 -0.105E-03 1 - 38 6 76562.15 -0.61166E+00 0.17235E-02 -0.54668E-01 0.30298E-02 -0.105E-03 1 - 38 6 76568.27 -0.60110E+00 0.16526E-02 -0.36105E-01 0.30298E-02 -0.105E-03 1 - 38 6 76568.27 -0.60110E+00 0.16526E-02 -0.36105E-01 0.30298E-02 -0.105E-03 1 - 38 6 76577.81 -0.58535E+00 0.15818E-02 -0.72207E-02 0.30298E-02 -0.105E-03 1 - 38 6 76577.81 -0.58535E+00 0.15818E-02 -0.72207E-02 0.30298E-02 -0.105E-03 1 - 38 6 76583.93 -0.57565E+00 0.15109E-02 0.11342E-01 0.30298E-02 -0.105E-03 1 - 38 6 76583.93 -0.57565E+00 0.15109E-02 0.11342E-01 0.30298E-02 -0.105E-03 1 - 38 6 76593.47 -0.56125E+00 0.14401E-02 0.40227E-01 0.30298E-02 -0.105E-03 1 - 38 6 76593.47 -0.56125E+00 0.14401E-02 0.40227E-01 0.30298E-02 -0.105E-03 1 - 38 6 76599.59 -0.55243E+00 0.13692E-02 0.58790E-01 0.30298E-02 -0.105E-03 1 - 38 6 76599.59 -0.55243E+00 0.13692E-02 0.58790E-01 0.30298E-02 -0.105E-03 1 - 38 6 76609.13 -0.53937E+00 0.12984E-02 0.87674E-01 0.30298E-02 -0.105E-03 1 - 38 6 76609.13 -0.53937E+00 0.12984E-02 0.87674E-01 0.30298E-02 -0.105E-03 1 - 38 6 76615.25 -0.53142E+00 0.12275E-02 0.10624E+00 0.30298E-02 -0.105E-03 1 - 38 6 76615.25 -0.53142E+00 0.12275E-02 0.10624E+00 0.30298E-02 -0.105E-03 1 - 38 6 76624.79 -0.51972E+00 0.11567E-02 0.13512E+00 0.30298E-02 -0.105E-03 1 - 38 6 76624.79 -0.51972E+00 0.11567E-02 0.13512E+00 0.30298E-02 -0.105E-03 1 - 38 6 76630.91 -0.51263E+00 0.10858E-02 0.15368E+00 0.30298E-02 -0.105E-03 1 - 38 6 76630.91 -0.51263E+00 0.10858E-02 0.15368E+00 0.30298E-02 -0.105E-03 1 - 38 6 76640.45 -0.50228E+00 0.10149E-02 0.18257E+00 0.30298E-02 -0.105E-03 1 - 38 6 76640.45 -0.50228E+00 0.10149E-02 0.18257E+00 0.30298E-02 -0.105E-03 1 - 38 6 76647.50 -0.49512E+00 -0.23521E-02 0.20394E+00 0.16429E-02 -0.105E-03 1 - 38 6 76647.50 -0.49512E+00 -0.23521E-02 0.20394E+00 0.16429E-02 -0.105E-03 1 - 38 6 76651.50 -0.50453E+00 -0.57831E-02 0.21052E+00 0.21126E-03 -0.105E-03 1 - 38 6 76651.50 -0.50453E+00 -0.57831E-02 0.21052E+00 0.21126E-03 -0.105E-03 1 - 38 6 76653.20 -0.51436E+00 -0.57803E-02 0.21088E+00 0.21406E-03 -0.105E-03 1 - 38 6 76653.20 -0.51436E+00 -0.57803E-02 0.21088E+00 0.21406E-03 -0.105E-03 1 - 38 6 76654.00 -0.51898E+00 -0.57774E-02 0.21105E+00 0.21689E-03 -0.105E-03 1 - 38 6 76654.00 -0.51898E+00 -0.57774E-02 0.21105E+00 0.21689E-03 -0.105E-03 1 - 38 6 76658.56 -0.54530E+00 -0.58482E-02 0.21203E+00 0.21689E-03 -0.105E-03 1 - 38 6 76658.56 -0.54530E+00 -0.58482E-02 0.21203E+00 0.21689E-03 -0.105E-03 1 - 38 6 76668.09 -0.60105E+00 -0.59191E-02 0.21410E+00 0.21689E-03 -0.105E-03 1 - 38 6 76668.09 -0.60105E+00 -0.59191E-02 0.21410E+00 0.21689E-03 -0.105E-03 1 - 38 6 76674.22 -0.63732E+00 -0.59899E-02 0.21543E+00 0.21689E-03 -0.105E-03 1 - 38 6 76674.22 -0.63732E+00 -0.59899E-02 0.21543E+00 0.21689E-03 -0.105E-03 1 - 38 6 76683.75 -0.69442E+00 -0.60608E-02 0.21750E+00 0.21689E-03 -0.105E-03 1 - 38 6 76683.75 -0.69442E+00 -0.60608E-02 0.21750E+00 0.21689E-03 -0.105E-03 1 - 38 6 76689.88 -0.73156E+00 -0.61316E-02 0.21883E+00 0.21689E-03 -0.105E-03 1 - 38 6 76689.88 -0.73156E+00 -0.61316E-02 0.21883E+00 0.21689E-03 -0.105E-03 1 - 38 6 76699.41 -0.79001E+00 -0.62024E-02 0.22090E+00 0.21689E-03 -0.105E-03 1 - 38 6 76699.41 -0.79001E+00 -0.62024E-02 0.22090E+00 0.21689E-03 -0.105E-03 1 - 38 6 76705.54 -0.82801E+00 -0.62733E-02 0.22222E+00 0.21689E-03 -0.105E-03 1 - 38 6 76705.54 -0.82801E+00 -0.62733E-02 0.22222E+00 0.21689E-03 -0.105E-03 1 - 38 6 76715.07 -0.88782E+00 -0.63441E-02 0.22429E+00 0.21689E-03 -0.105E-03 1 - 38 6 76715.07 -0.88782E+00 -0.63441E-02 0.22429E+00 0.21689E-03 -0.105E-03 1 - 38 6 76721.20 -0.92669E+00 -0.64149E-02 0.22562E+00 0.21689E-03 -0.105E-03 1 - 38 6 76721.20 -0.92669E+00 -0.64149E-02 0.22562E+00 0.21689E-03 -0.105E-03 1 - 38 6 76730.73 -0.98784E+00 -0.64858E-02 0.22769E+00 0.21689E-03 -0.105E-03 1 - 38 6 76730.73 -0.98784E+00 -0.64858E-02 0.22769E+00 0.21689E-03 -0.105E-03 1 - 38 6 76736.86 -0.10276E+01 -0.65566E-02 0.22902E+00 0.21689E-03 -0.105E-03 1 - 38 6 76736.86 -0.10276E+01 -0.65566E-02 0.22902E+00 0.21689E-03 -0.105E-03 1 - 38 6 76746.39 -0.10901E+01 -0.66274E-02 0.23108E+00 0.21689E-03 -0.105E-03 1 - 38 6 76746.39 -0.10901E+01 -0.66274E-02 0.23108E+00 0.21689E-03 -0.105E-03 1 - 38 6 76753.45 -0.11368E+01 0.11377E-02 0.23262E+00 0.18057E-02 -0.105E-03 1 - 38 6 76753.45 -0.11368E+01 0.11377E-02 0.23262E+00 0.18057E-02 -0.105E-03 1 - 38 6 76757.45 -0.11323E+01 0.88717E-02 0.23984E+00 0.34439E-02 -0.105E-03 1 - 38 6 76757.45 -0.11323E+01 0.88717E-02 0.23984E+00 0.34439E-02 -0.105E-03 1 - 38 6 76759.15 -0.11172E+01 0.88641E-02 0.24569E+00 0.34404E-02 -0.105E-03 1 - 38 6 76759.15 -0.11172E+01 0.88641E-02 0.24569E+00 0.34404E-02 -0.105E-03 1 - 38 6 76759.95 -0.11101E+01 0.88566E-02 0.24844E+00 0.34369E-02 -0.105E-03 1 - 38 6 76759.95 -0.11101E+01 0.88566E-02 0.24844E+00 0.34369E-02 -0.105E-03 1 - 38 6 76764.50 -0.10698E+01 0.87858E-02 0.26410E+00 0.34369E-02 -0.105E-03 1 - 38 6 76764.50 -0.10698E+01 0.87858E-02 0.26410E+00 0.34369E-02 -0.105E-03 1 - 38 6 76774.04 -0.98602E+00 0.87149E-02 0.29687E+00 0.34369E-02 -0.105E-03 1 - 38 6 76774.04 -0.98602E+00 0.87149E-02 0.29687E+00 0.34369E-02 -0.105E-03 1 - 38 6 76780.16 -0.93262E+00 0.86441E-02 0.31792E+00 0.34369E-02 -0.105E-03 1 - 38 6 76780.16 -0.93262E+00 0.86441E-02 0.31792E+00 0.34369E-02 -0.105E-03 1 - 38 6 76789.70 -0.85022E+00 0.85733E-02 0.35069E+00 0.34369E-02 -0.105E-03 1 - 38 6 76789.70 -0.85022E+00 0.85733E-02 0.35069E+00 0.34369E-02 -0.105E-03 1 - 38 6 76795.82 -0.79769E+00 0.85024E-02 0.37175E+00 0.34369E-02 -0.105E-03 1 - 38 6 76795.82 -0.79769E+00 0.85024E-02 0.37175E+00 0.34369E-02 -0.105E-03 1 - 38 6 76805.36 -0.71663E+00 0.84316E-02 0.40451E+00 0.34369E-02 -0.105E-03 1 - 38 6 76805.36 -0.71663E+00 0.84316E-02 0.40451E+00 0.34369E-02 -0.105E-03 1 - 38 6 76811.48 -0.66497E+00 0.83607E-02 0.42557E+00 0.34369E-02 -0.105E-03 1 - 38 6 76811.48 -0.66497E+00 0.83607E-02 0.42557E+00 0.34369E-02 -0.105E-03 1 - 38 6 76821.02 -0.58527E+00 0.82899E-02 0.45833E+00 0.34369E-02 -0.105E-03 1 - 38 6 76821.02 -0.58527E+00 0.82899E-02 0.45833E+00 0.34369E-02 -0.105E-03 1 - 38 6 76827.14 -0.53448E+00 0.82190E-02 0.47939E+00 0.34369E-02 -0.105E-03 1 - 38 6 76827.14 -0.53448E+00 0.82190E-02 0.47939E+00 0.34369E-02 -0.105E-03 1 - 38 6 76836.68 -0.45612E+00 0.81482E-02 0.51215E+00 0.34369E-02 -0.105E-03 1 - 38 6 76836.68 -0.45612E+00 0.81482E-02 0.51215E+00 0.34369E-02 -0.105E-03 1 - 38 6 76842.80 -0.40620E+00 0.80773E-02 0.53321E+00 0.34369E-02 -0.105E-03 1 - 38 6 76842.80 -0.40620E+00 0.80773E-02 0.53321E+00 0.34369E-02 -0.105E-03 1 - 38 6 76852.34 -0.32920E+00 0.80064E-02 0.56598E+00 0.34369E-02 -0.105E-03 1 - 38 6 76852.34 -0.32920E+00 0.80064E-02 0.56598E+00 0.34369E-02 -0.105E-03 1 - 38 6 76859.39 -0.27271E+00 0.61519E-02 0.59023E+00 -0.57695E-03 -0.105E-03 1 - 38 6 76859.39 -0.27271E+00 0.61519E-02 0.59023E+00 -0.57695E-03 -0.105E-03 1 - 38 6 76863.39 -0.24810E+00 0.44647E-02 0.58792E+00 -0.45751E-02 -0.105E-03 1 - 38 6 76863.39 -0.24810E+00 0.44647E-02 0.58792E+00 -0.45751E-02 -0.105E-03 1 - 38 6 76865.09 -0.24051E+00 0.44611E-02 0.58014E+00 -0.45715E-02 -0.105E-03 1 - 38 6 76865.09 -0.24051E+00 0.44611E-02 0.58014E+00 -0.45715E-02 -0.105E-03 1 - 38 6 76865.89 -0.23694E+00 0.44576E-02 0.57648E+00 -0.45679E-02 -0.105E-03 1 - 38 6 76865.89 -0.23694E+00 0.44576E-02 0.57648E+00 -0.45679E-02 -0.105E-03 1 - 38 6 76870.45 -0.21663E+00 0.43867E-02 0.55567E+00 -0.45679E-02 -0.105E-03 1 - 38 6 76870.45 -0.21663E+00 0.43867E-02 0.55567E+00 -0.45679E-02 -0.105E-03 1 - 38 6 76879.98 -0.17481E+00 0.43158E-02 0.51213E+00 -0.45679E-02 -0.105E-03 1 - 38 6 76879.98 -0.17481E+00 0.43158E-02 0.51213E+00 -0.45679E-02 -0.105E-03 1 - 38 6 76886.11 -0.14837E+00 0.42449E-02 0.48414E+00 -0.45679E-02 -0.105E-03 1 + 38 6 72295.69 0.13520E+01 -0.34433E-02 -0.18466E+00 -0.74757E-03 -0.105E-03 1 + 38 6 72296.29 0.13498E+01 -0.42371E-02 -0.18455E+00 0.10470E-02 -0.105E-03 1 + 49 6 72295.69 0.13567E+01 -0.37150E-02 0.87832E-01 -0.44705E-04 -0.581E-05 1 + 49 6 72296.29 0.13542E+01 -0.49919E-02 0.87963E-01 -0.11554E-04 -0.581E-05 1 + 38 6 72297.47 0.13448E+01 -0.42371E-02 -0.18331E+00 0.10470E-02 -0.105E-03 1 + 49 6 72297.47 0.13483E+01 -0.49919E-02 0.87949E-01 -0.11554E-04 -0.581E-05 1 + 38 6 72307.47 0.13025E+01 -0.42371E-02 -0.17284E+00 0.10470E-02 -0.105E-03 1 + 49 6 72307.47 0.12983E+01 -0.49919E-02 0.87833E-01 -0.11554E-04 -0.581E-05 1 + 38 6 72316.73 0.12632E+01 -0.42371E-02 -0.16315E+00 0.10470E-02 -0.105E-03 1 + 49 6 72316.73 0.12521E+01 -0.49919E-02 0.87726E-01 -0.11554E-04 -0.581E-05 1 + 38 6 72325.03 0.12281E+01 -0.42371E-02 -0.15446E+00 0.10470E-02 -0.105E-03 1 + 49 6 72325.03 0.12107E+01 -0.49919E-02 0.87631E-01 -0.11554E-04 -0.581E-05 1 + 38 6 72331.03 0.12026E+01 -0.42371E-02 -0.14818E+00 0.10470E-02 -0.105E-03 1 + 49 6 72331.03 0.11807E+01 -0.49919E-02 0.87561E-01 -0.11554E-04 -0.581E-05 1 + 38 6 72337.03 0.11772E+01 -0.42371E-02 -0.14189E+00 0.10470E-02 -0.105E-03 1 + 49 6 72337.03 0.11508E+01 -0.49919E-02 0.87492E-01 -0.11554E-04 -0.581E-05 1 + 38 6 72422.05 0.81696E+00 -0.42371E-02 -0.52874E-01 0.10470E-02 -0.105E-03 1 + 49 6 72422.05 0.72635E+00 -0.49919E-02 0.86510E-01 -0.11554E-04 -0.581E-05 1 + 38 6 72436.80 0.75446E+00 -0.42570E-02 -0.37431E-01 0.10470E-02 -0.105E-03 1 + 49 6 72436.80 0.65272E+00 -0.49930E-02 0.86339E-01 -0.11554E-04 -0.581E-05 1 + 38 6 72436.80 0.75446E+00 -0.42570E-02 -0.37431E-01 0.10470E-02 -0.105E-03 1 + 49 6 72436.80 0.65272E+00 -0.49930E-02 0.86339E-01 -0.11554E-04 -0.581E-05 1 + 38 6 72449.48 0.70051E+00 -0.42570E-02 -0.24160E-01 0.10470E-02 -0.105E-03 1 + 49 6 72449.48 0.58944E+00 -0.49930E-02 0.86193E-01 -0.11554E-04 -0.581E-05 1 + 38 6 72461.48 0.64942E+00 -0.42769E-02 -0.11595E-01 0.10470E-02 -0.105E-03 1 + 49 6 72461.48 0.52952E+00 -0.49941E-02 0.86054E-01 -0.11554E-04 -0.581E-05 1 + 38 6 72461.48 0.64942E+00 -0.42769E-02 -0.11595E-01 0.10470E-02 -0.105E-03 1 + 49 6 72461.48 0.52952E+00 -0.49941E-02 0.86054E-01 -0.11554E-04 -0.581E-05 1 + 38 6 72461.48 0.64942E+00 -0.42769E-02 -0.11595E-01 0.10470E-02 -0.105E-03 1 + 49 6 72461.48 0.52952E+00 -0.49941E-02 0.86054E-01 -0.11554E-04 -0.581E-05 1 + 38 6 72486.50 0.54239E+00 -0.42769E-02 0.14606E-01 0.10470E-02 -0.105E-03 1 + 49 6 72486.50 0.40454E+00 -0.49941E-02 0.85765E-01 -0.11554E-04 -0.581E-05 1 + 38 6 72496.50 0.49962E+00 -0.42769E-02 0.25076E-01 0.10470E-02 -0.105E-03 1 + 49 6 72496.50 0.35460E+00 -0.49941E-02 0.85649E-01 -0.11554E-04 -0.581E-05 1 + 38 6 72507.24 0.45369E+00 -0.42769E-02 0.36323E-01 0.10470E-02 -0.105E-03 1 + 49 6 72507.24 0.30096E+00 -0.49941E-02 0.85525E-01 -0.11554E-04 -0.581E-05 1 + 38 6 72516.50 0.41409E+00 -0.42769E-02 0.46017E-01 0.10470E-02 -0.105E-03 1 + 49 6 72516.50 0.25472E+00 -0.49941E-02 0.85418E-01 -0.11554E-04 -0.581E-05 1 + 38 6 72586.11 0.11636E+00 -0.42769E-02 0.11890E+00 0.10470E-02 -0.105E-03 1 + 49 6 72586.11 -0.92931E-01 -0.49941E-02 0.84614E-01 -0.11554E-04 -0.581E-05 1 + 38 6 72589.64 0.10130E+00 -0.42769E-02 0.12259E+00 0.10470E-02 -0.105E-03 1 + 49 6 72589.64 -0.11052E+00 -0.49941E-02 0.84573E-01 -0.11554E-04 -0.581E-05 1 + 38 6 72594.91 0.78748E-01 -0.42442E-02 0.12811E+00 0.99384E-03 -0.105E-03 1 + 49 6 72594.91 -0.13685E+00 -0.50509E-02 0.84512E-01 -0.46634E-04 -0.581E-05 1 + 38 6 72594.91 0.78748E-01 -0.42442E-02 0.12811E+00 0.99384E-03 -0.105E-03 1 + 49 6 72594.91 -0.13685E+00 -0.50509E-02 0.84512E-01 -0.46634E-04 -0.581E-05 1 + 38 6 72594.91 0.78748E-01 -0.42442E-02 0.12811E+00 0.99384E-03 -0.105E-03 1 + 49 6 72594.91 -0.13685E+00 -0.50509E-02 0.84512E-01 -0.46634E-04 -0.581E-05 1 + 49 6 72605.27 -0.18918E+00 -0.51294E-02 0.84029E-01 -0.81514E-04 -0.581E-05 1 + 49 6 72605.27 -0.18918E+00 -0.51294E-02 0.84029E-01 -0.81514E-04 -0.581E-05 1 + 49 6 72605.27 -0.18918E+00 -0.51294E-02 0.84029E-01 -0.81514E-04 -0.581E-05 1 + 49 6 72613.91 -0.23350E+00 -0.52264E-02 0.83325E-01 -0.11610E-03 -0.581E-05 1 + 49 6 72613.91 -0.23350E+00 -0.52264E-02 0.83325E-01 -0.11610E-03 -0.581E-05 1 + 49 6 72613.91 -0.23350E+00 -0.52264E-02 0.83325E-01 -0.11610E-03 -0.581E-05 1 + 49 6 72624.27 -0.28764E+00 -0.53458E-02 0.82122E-01 -0.15019E-03 -0.581E-05 1 + 49 6 72624.27 -0.28764E+00 -0.53458E-02 0.82122E-01 -0.15019E-03 -0.581E-05 1 + 49 6 72624.27 -0.28764E+00 -0.53458E-02 0.82122E-01 -0.15019E-03 -0.581E-05 1 + 38 6 72632.91 -0.82309E-01 -0.42836E-02 0.16258E+00 0.74350E-03 -0.105E-03 1 + 49 6 72632.91 -0.33383E+00 -0.54843E-02 0.80824E-01 -0.18374E-03 -0.581E-05 1 + 38 6 72632.91 -0.82309E-01 -0.42836E-02 0.16258E+00 0.74350E-03 -0.105E-03 1 + 49 6 72632.91 -0.33383E+00 -0.54843E-02 0.80824E-01 -0.18374E-03 -0.581E-05 1 + 38 6 72632.91 -0.82309E-01 -0.42836E-02 0.16258E+00 0.74350E-03 -0.105E-03 1 + 49 6 72632.91 -0.33383E+00 -0.54843E-02 0.80824E-01 -0.18374E-03 -0.581E-05 1 + 38 6 72643.27 -0.12669E+00 -0.43362E-02 0.17028E+00 0.67281E-03 -0.105E-03 1 + 49 6 72643.27 -0.39065E+00 -0.56465E-02 0.78921E-01 -0.21650E-03 -0.581E-05 1 + 38 6 72643.27 -0.12669E+00 -0.43362E-02 0.17028E+00 0.67281E-03 -0.105E-03 1 + 49 6 72643.27 -0.39065E+00 -0.56465E-02 0.78921E-01 -0.21650E-03 -0.581E-05 1 + 38 6 72643.27 -0.12669E+00 -0.43362E-02 0.17028E+00 0.67281E-03 -0.105E-03 1 + 49 6 72643.27 -0.39065E+00 -0.56465E-02 0.78921E-01 -0.21650E-03 -0.581E-05 1 + 38 6 72651.91 -0.16415E+00 -0.43378E-02 0.17609E+00 0.67102E-03 -0.105E-03 1 + 49 6 72651.91 -0.43943E+00 -0.56509E-02 0.77050E-01 -0.21728E-03 -0.581E-05 1 + 38 6 72651.91 -0.16415E+00 -0.43378E-02 0.17609E+00 0.67102E-03 -0.105E-03 1 + 49 6 72651.91 -0.43943E+00 -0.56509E-02 0.77050E-01 -0.21728E-03 -0.581E-05 1 + 38 6 72651.91 -0.16415E+00 -0.43378E-02 0.17609E+00 0.67102E-03 -0.105E-03 1 + 49 6 72651.91 -0.43943E+00 -0.56509E-02 0.77050E-01 -0.21728E-03 -0.581E-05 1 + 38 6 72662.27 -0.20909E+00 -0.43400E-02 0.18304E+00 0.66916E-03 -0.105E-03 1 + 49 6 72662.27 -0.49798E+00 -0.56560E-02 0.74799E-01 -0.21804E-03 -0.581E-05 1 + 38 6 72662.27 -0.20909E+00 -0.43400E-02 0.18304E+00 0.66916E-03 -0.105E-03 1 + 49 6 72662.27 -0.49798E+00 -0.56560E-02 0.74799E-01 -0.21804E-03 -0.581E-05 1 + 38 6 72662.27 -0.20909E+00 -0.43400E-02 0.18304E+00 0.66916E-03 -0.105E-03 1 + 49 6 72662.27 -0.49798E+00 -0.56560E-02 0.74799E-01 -0.21804E-03 -0.581E-05 1 + 38 6 72670.91 -0.24659E+00 -0.44423E-02 0.18882E+00 0.59078E-03 -0.105E-03 1 + 49 6 72670.91 -0.54685E+00 -0.58830E-02 0.72916E-01 -0.24830E-03 -0.581E-05 1 + 38 6 72670.91 -0.24659E+00 -0.44423E-02 0.18882E+00 0.59078E-03 -0.105E-03 1 + 49 6 72670.91 -0.54685E+00 -0.58830E-02 0.72916E-01 -0.24830E-03 -0.581E-05 1 + 38 6 72670.91 -0.24659E+00 -0.44423E-02 0.18882E+00 0.59078E-03 -0.105E-03 1 + 49 6 72670.91 -0.54685E+00 -0.58830E-02 0.72916E-01 -0.24830E-03 -0.581E-05 1 + 38 6 72681.27 -0.29261E+00 -0.45638E-02 0.19495E+00 0.50985E-03 -0.105E-03 1 + 49 6 72681.27 -0.60779E+00 -0.61353E-02 0.70343E-01 -0.27750E-03 -0.581E-05 1 + 38 6 72681.27 -0.29261E+00 -0.45638E-02 0.19495E+00 0.50985E-03 -0.105E-03 1 + 49 6 72681.27 -0.60779E+00 -0.61353E-02 0.70343E-01 -0.27750E-03 -0.581E-05 1 + 38 6 72681.27 -0.29261E+00 -0.45638E-02 0.19495E+00 0.50985E-03 -0.105E-03 1 + 49 6 72681.27 -0.60779E+00 -0.61353E-02 0.70343E-01 -0.27750E-03 -0.581E-05 1 + 38 6 72689.91 -0.33204E+00 -0.47016E-02 0.19935E+00 0.42709E-03 -0.105E-03 1 + 49 6 72689.91 -0.66080E+00 -0.64096E-02 0.67945E-01 -0.30571E-03 -0.581E-05 1 + 38 6 72689.91 -0.33204E+00 -0.47016E-02 0.19935E+00 0.42709E-03 -0.105E-03 1 + 49 6 72689.91 -0.66080E+00 -0.64096E-02 0.67945E-01 -0.30571E-03 -0.581E-05 1 + 38 6 72689.91 -0.33204E+00 -0.47016E-02 0.19935E+00 0.42709E-03 -0.105E-03 1 + 49 6 72689.91 -0.66080E+00 -0.64096E-02 0.67945E-01 -0.30571E-03 -0.581E-05 1 + 38 6 72700.27 -0.38075E+00 -0.48597E-02 0.20377E+00 0.34250E-03 -0.105E-03 1 + 49 6 72700.27 -0.72721E+00 -0.67114E-02 0.64778E-01 -0.33259E-03 -0.581E-05 1 + 38 6 72700.27 -0.38075E+00 -0.48597E-02 0.20377E+00 0.34250E-03 -0.105E-03 1 + 49 6 72700.27 -0.72721E+00 -0.67114E-02 0.64778E-01 -0.33259E-03 -0.581E-05 1 + 38 6 72700.27 -0.38075E+00 -0.48597E-02 0.20377E+00 0.34250E-03 -0.105E-03 1 + 49 6 72700.27 -0.72721E+00 -0.67114E-02 0.64778E-01 -0.33259E-03 -0.581E-05 1 + 38 6 72705.66 -0.40696E+00 -0.48597E-02 0.20562E+00 0.34250E-03 -0.105E-03 1 + 49 6 72705.66 -0.76340E+00 -0.67114E-02 0.62985E-01 -0.33259E-03 -0.581E-05 1 + 38 6 72803.38 -0.88184E+00 -0.48597E-02 0.23909E+00 0.34250E-03 -0.105E-03 1 + 49 6 72803.38 -0.14192E+01 -0.67114E-02 0.30484E-01 -0.33259E-03 -0.581E-05 1 + 38 6 72812.64 -0.92683E+00 -0.48597E-02 0.24226E+00 0.34250E-03 -0.105E-03 1 + 49 6 72812.64 -0.14814E+01 -0.67114E-02 0.27405E-01 -0.33259E-03 -0.581E-05 1 + 38 6 72823.38 -0.97903E+00 -0.48597E-02 0.24594E+00 0.34250E-03 -0.105E-03 1 + 49 6 72823.38 -0.15535E+01 -0.67114E-02 0.23832E-01 -0.33259E-03 -0.581E-05 1 + 38 6 72832.64 -0.10240E+01 -0.48597E-02 0.24911E+00 0.34250E-03 -0.105E-03 1 + 49 6 72832.64 -0.16156E+01 -0.67114E-02 0.20753E-01 -0.33259E-03 -0.581E-05 1 + 38 6 72881.09 -0.12595E+01 -0.48597E-02 0.26571E+00 0.34250E-03 -0.105E-03 1 + 49 6 72881.09 -0.19407E+01 -0.67114E-02 0.46394E-02 -0.33259E-03 -0.581E-05 1 + 38 6 72886.36 -0.12851E+01 -0.43349E-02 0.26751E+00 0.45175E-03 -0.105E-03 1 + 49 6 72886.36 -0.19761E+01 -0.59045E-02 0.28858E-02 -0.33142E-03 -0.581E-05 1 + 38 6 72886.36 -0.12851E+01 -0.43349E-02 0.26751E+00 0.45175E-03 -0.105E-03 1 + 49 6 72886.36 -0.19761E+01 -0.59045E-02 0.28858E-02 -0.33142E-03 -0.581E-05 1 + 38 6 72886.36 -0.12851E+01 -0.43349E-02 0.26751E+00 0.45175E-03 -0.105E-03 1 + 49 6 72886.36 -0.19761E+01 -0.59045E-02 0.28858E-02 -0.33142E-03 -0.581E-05 1 + 38 6 72896.72 -0.13300E+01 -0.37917E-02 0.27219E+00 0.56290E-03 -0.105E-03 1 + 49 6 72896.72 -0.20373E+01 -0.50726E-02 -0.54770E-03 -0.33164E-03 -0.581E-05 1 + 38 6 72896.72 -0.13300E+01 -0.37917E-02 0.27219E+00 0.56290E-03 -0.105E-03 1 + 49 6 72896.72 -0.20373E+01 -0.50726E-02 -0.54770E-03 -0.33164E-03 -0.581E-05 1 + 38 6 72896.72 -0.13300E+01 -0.37917E-02 0.27219E+00 0.56290E-03 -0.105E-03 1 + 49 6 72896.72 -0.20373E+01 -0.50726E-02 -0.54770E-03 -0.33164E-03 -0.581E-05 1 + 38 6 72905.36 -0.13628E+01 -0.32352E-02 0.27705E+00 0.67605E-03 -0.105E-03 1 + 49 6 72905.36 -0.20811E+01 -0.42228E-02 -0.34131E-02 -0.33303E-03 -0.581E-05 1 + 38 6 72905.36 -0.13628E+01 -0.32352E-02 0.27705E+00 0.67605E-03 -0.105E-03 1 + 49 6 72905.36 -0.20811E+01 -0.42228E-02 -0.34131E-02 -0.33303E-03 -0.581E-05 1 + 38 6 72905.36 -0.13628E+01 -0.32352E-02 0.27705E+00 0.67605E-03 -0.105E-03 1 + 49 6 72905.36 -0.20811E+01 -0.42228E-02 -0.34131E-02 -0.33303E-03 -0.581E-05 1 + 38 6 72915.72 -0.13963E+01 -0.26650E-02 0.28406E+00 0.79205E-03 -0.105E-03 1 + 49 6 72915.72 -0.21249E+01 -0.33551E-02 -0.68633E-02 -0.33584E-03 -0.581E-05 1 + 38 6 72915.72 -0.13963E+01 -0.26650E-02 0.28406E+00 0.79205E-03 -0.105E-03 1 + 49 6 72915.72 -0.21249E+01 -0.33551E-02 -0.68633E-02 -0.33584E-03 -0.581E-05 1 + 38 6 72915.72 -0.13963E+01 -0.26650E-02 0.28406E+00 0.79205E-03 -0.105E-03 1 + 49 6 72915.72 -0.21249E+01 -0.33551E-02 -0.68633E-02 -0.33584E-03 -0.581E-05 1 + 38 6 72930.03 -0.14344E+01 -0.26650E-02 0.29539E+00 0.79205E-03 -0.105E-03 1 + 49 6 72930.03 -0.21729E+01 -0.33551E-02 -0.11669E-01 -0.33584E-03 -0.581E-05 1 + 38 6 72939.29 -0.14591E+01 -0.26650E-02 0.30273E+00 0.79205E-03 -0.105E-03 1 + 49 6 72939.29 -0.22040E+01 -0.33551E-02 -0.14779E-01 -0.33584E-03 -0.581E-05 1 + 38 6 72948.86 -0.14846E+01 -0.20587E-02 0.31031E+00 0.91878E-03 -0.105E-03 1 + 49 6 72948.86 -0.22361E+01 -0.24420E-02 -0.17993E-01 -0.34318E-03 -0.581E-05 1 + 38 6 72948.86 -0.14846E+01 -0.20587E-02 0.31031E+00 0.91878E-03 -0.105E-03 1 + 49 6 72948.86 -0.22361E+01 -0.24420E-02 -0.17993E-01 -0.34318E-03 -0.581E-05 1 + 38 6 72948.86 -0.14846E+01 -0.20587E-02 0.31031E+00 0.91878E-03 -0.105E-03 1 + 49 6 72948.86 -0.22361E+01 -0.24420E-02 -0.17993E-01 -0.34318E-03 -0.581E-05 1 + 38 6 72959.22 -0.15059E+01 -0.14437E-02 0.31983E+00 0.10494E-02 -0.105E-03 1 + 49 6 72959.22 -0.22614E+01 -0.15186E-02 -0.21548E-01 -0.35198E-03 -0.581E-05 1 + 38 6 72959.22 -0.15059E+01 -0.14437E-02 0.31983E+00 0.10494E-02 -0.105E-03 1 + 49 6 72959.22 -0.22614E+01 -0.15186E-02 -0.21548E-01 -0.35198E-03 -0.581E-05 1 + 38 6 72959.22 -0.15059E+01 -0.14437E-02 0.31983E+00 0.10494E-02 -0.105E-03 1 + 49 6 72959.22 -0.22614E+01 -0.15186E-02 -0.21548E-01 -0.35198E-03 -0.581E-05 1 + 38 6 72967.86 -0.15184E+01 -0.12872E-02 0.32889E+00 0.10833E-02 -0.105E-03 1 + 49 6 72967.86 -0.22745E+01 -0.12841E-02 -0.24589E-01 -0.35452E-03 -0.581E-05 1 + 38 6 72967.86 -0.15184E+01 -0.12872E-02 0.32889E+00 0.10833E-02 -0.105E-03 1 + 49 6 72967.86 -0.22745E+01 -0.12841E-02 -0.24589E-01 -0.35452E-03 -0.581E-05 1 + 38 6 72967.86 -0.15184E+01 -0.12872E-02 0.32889E+00 0.10833E-02 -0.105E-03 1 + 49 6 72967.86 -0.22745E+01 -0.12841E-02 -0.24589E-01 -0.35452E-03 -0.581E-05 1 + 38 6 72978.22 -0.15317E+01 -0.11293E-02 0.34012E+00 0.11184E-02 -0.105E-03 1 + 49 6 72978.22 -0.22878E+01 -0.10483E-02 -0.28262E-01 -0.35743E-03 -0.581E-05 1 + 38 6 72978.22 -0.15317E+01 -0.11293E-02 0.34012E+00 0.11184E-02 -0.105E-03 1 + 49 6 72978.22 -0.22878E+01 -0.10483E-02 -0.28262E-01 -0.35743E-03 -0.581E-05 1 + 38 6 72978.22 -0.15317E+01 -0.11293E-02 0.34012E+00 0.11184E-02 -0.105E-03 1 + 49 6 72978.22 -0.22878E+01 -0.10483E-02 -0.28262E-01 -0.35743E-03 -0.581E-05 1 + 38 6 72986.86 -0.15415E+01 -0.49975E-03 0.34978E+00 0.12612E-02 -0.105E-03 1 + 49 6 72986.86 -0.22968E+01 -0.11039E-03 -0.31350E-01 -0.37023E-03 -0.581E-05 1 + 38 6 72986.86 -0.15415E+01 -0.49975E-03 0.34978E+00 0.12612E-02 -0.105E-03 1 + 49 6 72986.86 -0.22968E+01 -0.11039E-03 -0.31350E-01 -0.37023E-03 -0.581E-05 1 + 38 6 72986.86 -0.15415E+01 -0.49975E-03 0.34978E+00 0.12612E-02 -0.105E-03 1 + 49 6 72986.86 -0.22968E+01 -0.11039E-03 -0.31350E-01 -0.37023E-03 -0.581E-05 1 + 38 6 72997.22 -0.15467E+01 0.13188E-03 0.36284E+00 0.14094E-02 -0.105E-03 1 + 49 6 72997.22 -0.22980E+01 0.82797E-03 -0.35186E-01 -0.38460E-03 -0.581E-05 1 + 38 6 72997.22 -0.15467E+01 0.13188E-03 0.36284E+00 0.14094E-02 -0.105E-03 1 + 49 6 72997.22 -0.22980E+01 0.82797E-03 -0.35186E-01 -0.38460E-03 -0.581E-05 1 + 38 6 72997.22 -0.15467E+01 0.13188E-03 0.36284E+00 0.14094E-02 -0.105E-03 1 + 49 6 72997.22 -0.22980E+01 0.82797E-03 -0.35186E-01 -0.38460E-03 -0.581E-05 1 + 38 6 73005.86 -0.15455E+01 0.76304E-03 0.37502E+00 0.15625E-02 -0.105E-03 1 + 49 6 73005.86 -0.22908E+01 0.17634E-02 -0.38509E-01 -0.40033E-03 -0.581E-05 1 + 38 6 73005.86 -0.15455E+01 0.76304E-03 0.37502E+00 0.15625E-02 -0.105E-03 1 + 49 6 73005.86 -0.22908E+01 0.17634E-02 -0.38509E-01 -0.40033E-03 -0.581E-05 1 + 38 6 73005.86 -0.15455E+01 0.76304E-03 0.37502E+00 0.15625E-02 -0.105E-03 1 + 49 6 73005.86 -0.22908E+01 0.17634E-02 -0.38509E-01 -0.40033E-03 -0.581E-05 1 + 38 6 73016.22 -0.15376E+01 0.13910E-02 0.39121E+00 0.17223E-02 -0.105E-03 1 + 49 6 73016.22 -0.22726E+01 0.26914E-02 -0.42656E-01 -0.41774E-03 -0.581E-05 1 + 38 6 73016.22 -0.15376E+01 0.13910E-02 0.39121E+00 0.17223E-02 -0.105E-03 1 + 49 6 73016.22 -0.22726E+01 0.26914E-02 -0.42656E-01 -0.41774E-03 -0.581E-05 1 + 38 6 73016.22 -0.15376E+01 0.13910E-02 0.39121E+00 0.17223E-02 -0.105E-03 1 + 49 6 73016.22 -0.22726E+01 0.26914E-02 -0.42656E-01 -0.41774E-03 -0.581E-05 1 + 38 6 73021.61 -0.15301E+01 0.13910E-02 0.40050E+00 0.17223E-02 -0.105E-03 1 + 49 6 73021.61 -0.22581E+01 0.26914E-02 -0.44909E-01 -0.41774E-03 -0.581E-05 1 + 38 6 73075.21 -0.14556E+01 0.13910E-02 0.49282E+00 0.17223E-02 -0.105E-03 1 + 49 6 73075.21 -0.21138E+01 0.26914E-02 -0.67301E-01 -0.41774E-03 -0.581E-05 1 + 38 6 73085.21 -0.14417E+01 0.13910E-02 0.51004E+00 0.17223E-02 -0.105E-03 1 + 49 6 73085.21 -0.20869E+01 0.26914E-02 -0.71479E-01 -0.41774E-03 -0.581E-05 1 + 38 6 73279.66 -0.11712E+01 0.13910E-02 0.84493E+00 0.17223E-02 -0.105E-03 1 + 38 6 73288.92 -0.11583E+01 0.13910E-02 0.86088E+00 0.17223E-02 -0.105E-03 1 + 38 6 73299.66 -0.11434E+01 0.13910E-02 0.87938E+00 0.17223E-02 -0.105E-03 1 + 38 6 73308.92 -0.11305E+01 0.13910E-02 0.89532E+00 0.17223E-02 -0.105E-03 1 + 38 6 73311.92 -0.11263E+01 0.13910E-02 0.90049E+00 0.17223E-02 -0.105E-03 1 + 38 6 73311.92 -0.11263E+01 0.13910E-02 0.90049E+00 0.17223E-02 -0.105E-03 1 + 38 6 73311.92 -0.11263E+01 0.13910E-02 0.90049E+00 0.17223E-02 -0.105E-03 1 + 38 6 73319.66 -0.11155E+01 0.13910E-02 0.91382E+00 0.17223E-02 -0.105E-03 1 + 38 6 73328.92 -0.11027E+01 0.13910E-02 0.92977E+00 0.17223E-02 -0.105E-03 1 + 38 6 73562.62 -0.77758E+00 0.13910E-02 0.13323E+01 0.17223E-02 -0.105E-03 1 + 38 6 73572.62 -0.76367E+00 0.13910E-02 0.13495E+01 0.17223E-02 -0.105E-03 1 + 38 6 73601.85 -0.72303E+00 0.13910E-02 0.13998E+01 0.17223E-02 -0.105E-03 1 + 38 6 73607.62 -0.71500E+00 0.10990E-02 0.14098E+01 0.11466E-02 -0.105E-03 1 + 38 6 73607.62 -0.71500E+00 0.10990E-02 0.14098E+01 0.11466E-02 -0.105E-03 1 + 38 6 73607.62 -0.71500E+00 0.10990E-02 0.14098E+01 0.11466E-02 -0.105E-03 1 + 38 6 73617.98 -0.70361E+00 0.81165E-03 0.14217E+01 0.56600E-03 -0.105E-03 1 + 38 6 73617.98 -0.70361E+00 0.81165E-03 0.14217E+01 0.56600E-03 -0.105E-03 1 + 38 6 73617.98 -0.70361E+00 0.81165E-03 0.14217E+01 0.56600E-03 -0.105E-03 1 + 38 6 73626.62 -0.69660E+00 0.52717E-03 0.14265E+01 -0.16577E-04 -0.105E-03 1 + 38 6 73626.62 -0.69660E+00 0.52717E-03 0.14265E+01 -0.16577E-04 -0.105E-03 1 + 38 6 73626.62 -0.69660E+00 0.52717E-03 0.14265E+01 -0.16577E-04 -0.105E-03 1 + 38 6 73636.98 -0.69114E+00 0.24492E-03 0.14264E+01 -0.59908E-03 -0.105E-03 1 + 38 6 73636.98 -0.69114E+00 0.24492E-03 0.14264E+01 -0.59908E-03 -0.105E-03 1 + 38 6 73636.98 -0.69114E+00 0.24492E-03 0.14264E+01 -0.59908E-03 -0.105E-03 1 + 38 6 73645.62 -0.68902E+00 0.31596E-03 0.14212E+01 -0.45255E-03 -0.105E-03 1 + 38 6 73645.62 -0.68902E+00 0.31596E-03 0.14212E+01 -0.45255E-03 -0.105E-03 1 + 38 6 73645.62 -0.68902E+00 0.31596E-03 0.14212E+01 -0.45255E-03 -0.105E-03 1 + 38 6 73655.98 -0.68575E+00 0.38666E-03 0.14165E+01 -0.30651E-03 -0.105E-03 1 + 38 6 73655.98 -0.68575E+00 0.38666E-03 0.14165E+01 -0.30651E-03 -0.105E-03 1 + 38 6 73655.98 -0.68575E+00 0.38666E-03 0.14165E+01 -0.30651E-03 -0.105E-03 1 + 38 6 73664.62 -0.68241E+00 0.10798E-03 0.14139E+01 -0.88390E-03 -0.105E-03 1 + 38 6 73664.62 -0.68241E+00 0.10798E-03 0.14139E+01 -0.88390E-03 -0.105E-03 1 + 38 6 73664.62 -0.68241E+00 0.10798E-03 0.14139E+01 -0.88390E-03 -0.105E-03 1 + 38 6 73674.98 -0.68129E+00 -0.17025E-03 0.14047E+01 -0.14576E-02 -0.105E-03 1 + 38 6 73674.98 -0.68129E+00 -0.17025E-03 0.14047E+01 -0.14576E-02 -0.105E-03 1 + 38 6 73674.98 -0.68129E+00 -0.17025E-03 0.14047E+01 -0.14576E-02 -0.105E-03 1 + 38 6 73708.12 -0.68693E+00 -0.45078E-03 0.13564E+01 -0.20115E-02 -0.105E-03 1 + 38 6 73708.12 -0.68693E+00 -0.45078E-03 0.13564E+01 -0.20115E-02 -0.105E-03 1 + 38 6 73708.12 -0.68693E+00 -0.45078E-03 0.13564E+01 -0.20115E-02 -0.105E-03 1 + 38 6 73718.48 -0.69160E+00 -0.73321E-03 0.13356E+01 -0.25569E-02 -0.105E-03 1 + 38 6 73718.48 -0.69160E+00 -0.73321E-03 0.13356E+01 -0.25569E-02 -0.105E-03 1 + 38 6 73718.48 -0.69160E+00 -0.73321E-03 0.13356E+01 -0.25569E-02 -0.105E-03 1 + 38 6 73727.12 -0.69794E+00 -0.10182E-02 0.13135E+01 -0.30933E-02 -0.105E-03 1 + 38 6 73727.12 -0.69794E+00 -0.10182E-02 0.13135E+01 -0.30933E-02 -0.105E-03 1 + 38 6 73727.12 -0.69794E+00 -0.10182E-02 0.13135E+01 -0.30933E-02 -0.105E-03 1 + 38 6 73737.48 -0.70848E+00 -0.13076E-02 0.12814E+01 -0.36166E-02 -0.105E-03 1 + 38 6 73737.48 -0.70848E+00 -0.13076E-02 0.12814E+01 -0.36166E-02 -0.105E-03 1 + 38 6 73737.48 -0.70848E+00 -0.13076E-02 0.12814E+01 -0.36166E-02 -0.105E-03 1 + 38 6 73742.37 -0.71488E+00 -0.13076E-02 0.12637E+01 -0.36166E-02 -0.105E-03 1 + 38 6 73755.20 -0.73165E+00 -0.13076E-02 0.12173E+01 -0.36166E-02 -0.105E-03 1 + 38 6 73765.20 -0.74473E+00 -0.13076E-02 0.11812E+01 -0.36166E-02 -0.105E-03 1 + 38 6 73775.94 -0.75878E+00 -0.13076E-02 0.11423E+01 -0.36166E-02 -0.105E-03 1 + 38 6 73785.20 -0.77088E+00 -0.13076E-02 0.11088E+01 -0.36166E-02 -0.105E-03 1 + 38 6 73835.20 -0.83626E+00 -0.13076E-02 0.92801E+00 -0.36166E-02 -0.105E-03 1 + 38 6 73845.20 -0.84934E+00 -0.13076E-02 0.89184E+00 -0.36166E-02 -0.105E-03 1 + 38 6 73855.94 -0.86338E+00 -0.13076E-02 0.85299E+00 -0.36166E-02 -0.105E-03 1 + 38 6 73865.20 -0.87549E+00 -0.13076E-02 0.81951E+00 -0.36166E-02 -0.105E-03 1 + 38 6 73875.94 -0.88953E+00 -0.13076E-02 0.78066E+00 -0.36166E-02 -0.105E-03 1 + 38 6 73885.20 -0.90164E+00 -0.13076E-02 0.74718E+00 -0.36166E-02 -0.105E-03 1 + 38 6 73917.80 -0.94426E+00 -0.13076E-02 0.62928E+00 -0.36166E-02 -0.105E-03 1 + 38 6 73923.57 -0.95181E+00 -0.91244E-03 0.60841E+00 -0.33640E-02 -0.105E-03 1 + 38 6 73923.57 -0.95181E+00 -0.91244E-03 0.60841E+00 -0.33640E-02 -0.105E-03 1 + 38 6 73923.57 -0.95181E+00 -0.91244E-03 0.60841E+00 -0.33640E-02 -0.105E-03 1 + 38 6 73933.93 -0.96126E+00 -0.51340E-03 0.57356E+00 -0.31259E-02 -0.105E-03 1 + 38 6 73933.93 -0.96126E+00 -0.51340E-03 0.57356E+00 -0.31259E-02 -0.105E-03 1 + 38 6 73933.93 -0.96126E+00 -0.51340E-03 0.57356E+00 -0.31259E-02 -0.105E-03 1 + 38 6 73942.57 -0.96570E+00 -0.11251E-03 0.54655E+00 -0.28990E-02 -0.105E-03 1 + 38 6 73942.57 -0.96570E+00 -0.11251E-03 0.54655E+00 -0.28990E-02 -0.105E-03 1 + 38 6 73942.57 -0.96570E+00 -0.11251E-03 0.54655E+00 -0.28990E-02 -0.105E-03 1 + 38 6 73952.93 -0.96686E+00 0.28887E-03 0.51651E+00 -0.26846E-02 -0.105E-03 1 + 38 6 73952.93 -0.96686E+00 0.28887E-03 0.51651E+00 -0.26846E-02 -0.105E-03 1 + 38 6 73952.93 -0.96686E+00 0.28887E-03 0.51651E+00 -0.26846E-02 -0.105E-03 1 + 38 6 73961.57 -0.96437E+00 0.27908E-03 0.49332E+00 -0.26896E-02 -0.105E-03 1 + 38 6 73961.57 -0.96437E+00 0.27908E-03 0.49332E+00 -0.26896E-02 -0.105E-03 1 + 38 6 73961.57 -0.96437E+00 0.27908E-03 0.49332E+00 -0.26896E-02 -0.105E-03 1 + 38 6 73971.93 -0.96148E+00 0.26932E-03 0.46545E+00 -0.26944E-02 -0.105E-03 1 + 38 6 73971.93 -0.96148E+00 0.26932E-03 0.46545E+00 -0.26944E-02 -0.105E-03 1 + 38 6 73971.93 -0.96148E+00 0.26932E-03 0.46545E+00 -0.26944E-02 -0.105E-03 1 + 38 6 73980.57 -0.95915E+00 0.66749E-03 0.44217E+00 -0.25108E-02 -0.105E-03 1 + 38 6 73980.57 -0.95915E+00 0.66749E-03 0.44217E+00 -0.25108E-02 -0.105E-03 1 + 38 6 73980.57 -0.95915E+00 0.66749E-03 0.44217E+00 -0.25108E-02 -0.105E-03 1 + 38 6 73990.93 -0.95224E+00 0.10628E-02 0.41616E+00 -0.23380E-02 -0.105E-03 1 + 38 6 73990.93 -0.95224E+00 0.10628E-02 0.41616E+00 -0.23380E-02 -0.105E-03 1 + 38 6 73990.93 -0.95224E+00 0.10628E-02 0.41616E+00 -0.23380E-02 -0.105E-03 1 + 38 6 73999.57 -0.94305E+00 0.14543E-02 0.39596E+00 -0.21737E-02 -0.105E-03 1 + 38 6 73999.57 -0.94305E+00 0.14543E-02 0.39596E+00 -0.21737E-02 -0.105E-03 1 + 38 6 73999.57 -0.94305E+00 0.14543E-02 0.39596E+00 -0.21737E-02 -0.105E-03 1 + 38 6 74009.93 -0.92799E+00 0.18395E-02 0.37344E+00 -0.20186E-02 -0.105E-03 1 + 38 6 74009.93 -0.92799E+00 0.18395E-02 0.37344E+00 -0.20186E-02 -0.105E-03 1 + 38 6 74009.93 -0.92799E+00 0.18395E-02 0.37344E+00 -0.20186E-02 -0.105E-03 1 + 38 6 74018.57 -0.91209E+00 0.22181E-02 0.35600E+00 -0.18708E-02 -0.105E-03 1 + 38 6 74018.57 -0.91209E+00 0.22181E-02 0.35600E+00 -0.18708E-02 -0.105E-03 1 + 38 6 74018.57 -0.91209E+00 0.22181E-02 0.35600E+00 -0.18708E-02 -0.105E-03 1 + 38 6 74028.93 -0.88911E+00 0.25872E-02 0.33662E+00 -0.17311E-02 -0.105E-03 1 + 38 6 74028.93 -0.88911E+00 0.25872E-02 0.33662E+00 -0.17311E-02 -0.105E-03 1 + 38 6 74028.93 -0.88911E+00 0.25872E-02 0.33662E+00 -0.17311E-02 -0.105E-03 1 + 38 6 74033.82 -0.87645E+00 0.25872E-02 0.32815E+00 -0.17311E-02 -0.105E-03 1 + 38 6 74048.96 -0.83727E+00 0.25872E-02 0.30194E+00 -0.17311E-02 -0.105E-03 1 + 38 6 74058.22 -0.81332E+00 0.25872E-02 0.28591E+00 -0.17311E-02 -0.105E-03 1 + 38 6 74084.29 -0.74587E+00 0.25872E-02 0.24078E+00 -0.17311E-02 -0.105E-03 1 + 38 6 74162.36 -0.54389E+00 0.25674E-02 0.10563E+00 -0.17311E-02 -0.105E-03 1 + 38 6 74162.36 -0.54389E+00 0.25674E-02 0.10563E+00 -0.17311E-02 -0.105E-03 1 + 38 6 74162.36 -0.54389E+00 0.25674E-02 0.10563E+00 -0.17311E-02 -0.105E-03 1 + 38 6 74187.04 -0.48054E+00 0.25475E-02 0.62919E-01 -0.17311E-02 -0.105E-03 1 + 38 6 74187.04 -0.48054E+00 0.25475E-02 0.62919E-01 -0.17311E-02 -0.105E-03 1 + 38 6 74238.66 -0.34902E+00 0.25475E-02 -0.26456E-01 -0.17311E-02 -0.105E-03 1 + 38 6 74362.81 -0.32757E-01 0.25674E-02 -0.24136E+00 -0.17311E-02 -0.105E-03 1 + 38 6 74362.81 -0.32757E-01 0.25674E-02 -0.24136E+00 -0.17311E-02 -0.105E-03 1 + 38 6 74383.98 0.21607E-01 0.25872E-02 -0.27802E+00 -0.17311E-02 -0.105E-03 1 + 38 6 74383.98 0.21607E-01 0.25872E-02 -0.27802E+00 -0.17311E-02 -0.105E-03 1 + 38 6 74383.98 0.21607E-01 0.25872E-02 -0.27802E+00 -0.17311E-02 -0.105E-03 1 + 38 6 74405.01 0.76007E-01 0.25872E-02 -0.31442E+00 -0.17311E-02 -0.105E-03 1 + 38 6 74415.01 0.10188E+00 0.25872E-02 -0.33173E+00 -0.17311E-02 -0.105E-03 1 + 38 6 74429.90 0.14040E+00 0.25872E-02 -0.35750E+00 -0.17311E-02 -0.105E-03 1 + 38 6 74434.58 0.15252E+00 0.26439E-02 -0.36561E+00 -0.15952E-02 -0.105E-03 1 + 38 6 74434.58 0.15252E+00 0.26439E-02 -0.36561E+00 -0.15952E-02 -0.105E-03 1 + 38 6 74434.58 0.15252E+00 0.26439E-02 -0.36561E+00 -0.15952E-02 -0.105E-03 1 + 38 6 74438.91 0.16397E+00 0.27049E-02 -0.37252E+00 -0.14567E-02 -0.105E-03 1 + 38 6 74438.91 0.16397E+00 0.27049E-02 -0.37252E+00 -0.14567E-02 -0.105E-03 1 + 38 6 74441.86 0.17193E+00 0.27688E-02 -0.37681E+00 -0.13166E-02 -0.105E-03 1 + 38 6 74441.86 0.17193E+00 0.27688E-02 -0.37681E+00 -0.13166E-02 -0.105E-03 1 + 38 6 74446.19 0.18393E+00 0.28372E-02 -0.38251E+00 -0.11744E-02 -0.105E-03 1 + 38 6 74446.19 0.18393E+00 0.28372E-02 -0.38251E+00 -0.11744E-02 -0.105E-03 1 + 38 6 74449.13 0.19228E+00 0.29087E-02 -0.38597E+00 -0.10309E-02 -0.105E-03 1 + 38 6 74449.13 0.19228E+00 0.29087E-02 -0.38597E+00 -0.10309E-02 -0.105E-03 1 + 38 6 74453.46 0.20488E+00 0.29849E-02 -0.39043E+00 -0.88575E-03 -0.105E-03 1 + 38 6 74453.46 0.20488E+00 0.29849E-02 -0.39043E+00 -0.88575E-03 -0.105E-03 1 + 38 6 74456.41 0.21366E+00 0.30643E-02 -0.39304E+00 -0.73962E-03 -0.105E-03 1 + 38 6 74456.41 0.21366E+00 0.30643E-02 -0.39304E+00 -0.73962E-03 -0.105E-03 1 + 38 6 74460.74 0.22694E+00 0.31487E-02 -0.39625E+00 -0.59231E-03 -0.105E-03 1 + 38 6 74460.74 0.22694E+00 0.31487E-02 -0.39625E+00 -0.59231E-03 -0.105E-03 1 + 38 6 74463.69 0.23622E+00 0.32365E-02 -0.39799E+00 -0.44435E-03 -0.105E-03 1 + 38 6 74463.69 0.23622E+00 0.32365E-02 -0.39799E+00 -0.44435E-03 -0.105E-03 1 + 38 6 74468.02 0.25024E+00 0.33295E-02 -0.39992E+00 -0.29567E-03 -0.105E-03 1 + 38 6 74468.02 0.25024E+00 0.33295E-02 -0.39992E+00 -0.29567E-03 -0.105E-03 1 + 38 6 74470.97 0.26005E+00 0.34262E-02 -0.40079E+00 -0.14666E-03 -0.105E-03 1 + 38 6 74470.97 0.26005E+00 0.34262E-02 -0.40079E+00 -0.14666E-03 -0.105E-03 1 + 38 6 74475.30 0.27490E+00 0.35284E-02 -0.40142E+00 0.25741E-05 -0.105E-03 1 + 38 6 74475.30 0.27490E+00 0.35284E-02 -0.40142E+00 0.25741E-05 -0.105E-03 1 + 38 6 74475.30 0.27490E+00 0.35284E-02 -0.40142E+00 0.25741E-05 -0.105E-03 1 + 38 6 74503.15 0.37316E+00 0.35284E-02 -0.40135E+00 0.25741E-05 -0.105E-03 1 + 38 6 74561.60 0.57939E+00 0.35284E-02 -0.40120E+00 0.25741E-05 -0.105E-03 1 + 38 6 74620.08 0.78574E+00 0.35284E-02 -0.40105E+00 0.25741E-05 -0.105E-03 1 + 38 6 74627.65 0.81244E+00 0.12639E-02 -0.40103E+00 -0.11152E-02 -0.105E-03 1 + 38 6 74627.65 0.81244E+00 0.12639E-02 -0.40103E+00 -0.11152E-02 -0.105E-03 1 + 38 6 74627.65 0.81244E+00 0.12639E-02 -0.40103E+00 -0.11152E-02 -0.105E-03 1 + 38 6 74637.98 0.82550E+00 -0.10369E-02 -0.41255E+00 -0.22651E-02 -0.105E-03 1 + 38 6 74637.98 0.82550E+00 -0.10369E-02 -0.41255E+00 -0.22651E-02 -0.105E-03 1 + 38 6 74642.49 0.82082E+00 -0.13393E-02 -0.42277E+00 -0.24208E-02 -0.105E-03 1 + 38 6 74642.49 0.82082E+00 -0.13393E-02 -0.42277E+00 -0.24208E-02 -0.105E-03 1 + 38 6 74646.82 0.81502E+00 -0.16395E-02 -0.43326E+00 -0.25804E-02 -0.105E-03 1 + 38 6 74646.82 0.81502E+00 -0.16395E-02 -0.43326E+00 -0.25804E-02 -0.105E-03 1 + 38 6 74657.95 0.79677E+00 -0.42306E-02 -0.46198E+00 -0.40828E-02 -0.105E-03 1 + 38 6 74657.95 0.79677E+00 -0.42306E-02 -0.46198E+00 -0.40828E-02 -0.105E-03 1 + 38 6 74664.02 0.77111E+00 -0.67381E-02 -0.48675E+00 -0.56656E-02 -0.105E-03 1 + 38 6 74664.02 0.77111E+00 -0.67381E-02 -0.48675E+00 -0.56656E-02 -0.105E-03 1 + 38 6 74681.14 0.65573E+00 0.38421E-03 -0.58377E+00 0.67511E-03 -0.105E-03 1 + 38 6 74681.14 0.65573E+00 0.38421E-03 -0.58377E+00 0.67511E-03 -0.105E-03 1 + 38 6 74687.21 0.65806E+00 0.75319E-02 -0.57967E+00 0.69714E-02 -0.105E-03 1 + 38 6 74687.21 0.65806E+00 0.75319E-02 -0.57967E+00 0.69714E-02 -0.105E-03 1 + 38 6 74704.33 0.78703E+00 0.10606E-03 -0.46030E+00 0.26283E-02 -0.105E-03 1 + 38 6 74704.33 0.78703E+00 0.10606E-03 -0.46030E+00 0.26283E-02 -0.105E-03 1 + 38 6 74710.40 0.78767E+00 -0.73258E-02 -0.44435E+00 -0.15643E-02 -0.105E-03 1 + 38 6 74710.40 0.78767E+00 -0.73258E-02 -0.44435E+00 -0.15643E-02 -0.105E-03 1 + 38 6 74717.97 0.73221E+00 -0.73967E-02 -0.45620E+00 -0.15643E-02 -0.105E-03 1 + 38 6 74717.97 0.73221E+00 -0.73967E-02 -0.45620E+00 -0.15643E-02 -0.105E-03 1 + 38 6 74727.50 0.66170E+00 -0.74677E-02 -0.47111E+00 -0.15643E-02 -0.105E-03 1 + 38 6 74727.50 0.66170E+00 -0.74677E-02 -0.47111E+00 -0.15643E-02 -0.105E-03 1 + 38 6 74733.63 0.61594E+00 -0.75386E-02 -0.48069E+00 -0.15643E-02 -0.105E-03 1 + 38 6 74733.63 0.61594E+00 -0.75386E-02 -0.48069E+00 -0.15643E-02 -0.105E-03 1 + 38 6 74743.16 0.54408E+00 -0.76095E-02 -0.49560E+00 -0.15643E-02 -0.105E-03 1 + 38 6 74743.16 0.54408E+00 -0.76095E-02 -0.49560E+00 -0.15643E-02 -0.105E-03 1 + 38 6 74749.29 0.49745E+00 -0.76804E-02 -0.50519E+00 -0.15643E-02 -0.105E-03 1 + 38 6 74749.29 0.49745E+00 -0.76804E-02 -0.50519E+00 -0.15643E-02 -0.105E-03 1 + 38 6 74758.83 0.42423E+00 -0.77514E-02 -0.52010E+00 -0.15643E-02 -0.105E-03 1 + 38 6 74758.83 0.42423E+00 -0.77514E-02 -0.52010E+00 -0.15643E-02 -0.105E-03 1 + 38 6 74764.95 0.37674E+00 -0.78223E-02 -0.52969E+00 -0.15643E-02 -0.105E-03 1 + 38 6 74764.95 0.37674E+00 -0.78223E-02 -0.52969E+00 -0.15643E-02 -0.105E-03 1 + 38 6 74774.49 0.30217E+00 -0.78932E-02 -0.54460E+00 -0.15643E-02 -0.105E-03 1 + 38 6 74774.49 0.30217E+00 -0.78932E-02 -0.54460E+00 -0.15643E-02 -0.105E-03 1 + 38 6 74786.21 0.20966E+00 -0.65157E-02 -0.56293E+00 0.21342E-02 -0.105E-03 1 + 38 6 74786.21 0.20966E+00 -0.65157E-02 -0.56293E+00 0.21342E-02 -0.105E-03 1 + 38 6 74792.87 0.16622E+00 -0.54236E-02 -0.54870E+00 0.57392E-02 -0.105E-03 1 + 38 6 74792.87 0.16622E+00 -0.54236E-02 -0.54870E+00 0.57392E-02 -0.105E-03 1 + 38 6 74800.59 0.12435E+00 -0.54945E-02 -0.50440E+00 0.57392E-02 -0.105E-03 1 + 38 6 74800.59 0.12435E+00 -0.54945E-02 -0.50440E+00 0.57392E-02 -0.105E-03 1 + 38 6 74810.13 0.71972E-01 -0.55654E-02 -0.44968E+00 0.57392E-02 -0.105E-03 1 + 38 6 74810.13 0.71972E-01 -0.55654E-02 -0.44968E+00 0.57392E-02 -0.105E-03 1 + 38 6 74816.25 0.37874E-01 -0.56363E-02 -0.41452E+00 0.57392E-02 -0.105E-03 1 + 38 6 74816.25 0.37874E-01 -0.56363E-02 -0.41452E+00 0.57392E-02 -0.105E-03 1 + 38 6 74825.79 -0.15859E-01 -0.57072E-02 -0.35981E+00 0.57392E-02 -0.105E-03 1 + 38 6 74825.79 -0.15859E-01 -0.57072E-02 -0.35981E+00 0.57392E-02 -0.105E-03 1 + 38 6 74831.91 -0.50826E-01 -0.57781E-02 -0.32464E+00 0.57392E-02 -0.105E-03 1 + 38 6 74831.91 -0.50826E-01 -0.57781E-02 -0.32464E+00 0.57392E-02 -0.105E-03 1 + 38 6 74841.45 -0.10591E+00 -0.58489E-02 -0.26993E+00 0.57392E-02 -0.105E-03 1 + 38 6 74841.45 -0.10591E+00 -0.58489E-02 -0.26993E+00 0.57392E-02 -0.105E-03 1 + 38 6 74847.57 -0.14175E+00 -0.59198E-02 -0.23477E+00 0.57392E-02 -0.105E-03 1 + 38 6 74847.57 -0.14175E+00 -0.59198E-02 -0.23477E+00 0.57392E-02 -0.105E-03 1 + 38 6 74857.11 -0.19818E+00 -0.59907E-02 -0.18005E+00 0.57392E-02 -0.105E-03 1 + 38 6 74857.11 -0.19818E+00 -0.59907E-02 -0.18005E+00 0.57392E-02 -0.105E-03 1 + 38 6 74864.83 -0.24443E+00 -0.34285E-02 -0.13575E+00 0.43162E-02 -0.105E-03 1 + 38 6 74864.83 -0.24443E+00 -0.34285E-02 -0.13575E+00 0.43162E-02 -0.105E-03 1 + 38 6 74871.49 -0.26729E+00 -0.62673E-03 -0.10697E+00 0.31949E-02 -0.105E-03 1 + 38 6 74871.49 -0.26729E+00 -0.62673E-03 -0.10697E+00 0.31949E-02 -0.105E-03 1 + 38 6 74879.21 -0.27213E+00 -0.69760E-03 -0.82309E-01 0.31949E-02 -0.105E-03 1 + 38 6 74879.21 -0.27213E+00 -0.69760E-03 -0.82309E-01 0.31949E-02 -0.105E-03 1 + 38 6 74888.75 -0.27878E+00 -0.76847E-03 -0.51851E-01 0.31949E-02 -0.105E-03 1 + 38 6 74888.75 -0.27878E+00 -0.76847E-03 -0.51851E-01 0.31949E-02 -0.105E-03 1 + 38 6 74894.87 -0.28348E+00 -0.83934E-03 -0.32276E-01 0.31949E-02 -0.105E-03 1 + 38 6 74894.87 -0.28348E+00 -0.83934E-03 -0.32276E-01 0.31949E-02 -0.105E-03 1 + 38 6 74904.41 -0.29149E+00 -0.91021E-03 -0.18183E-02 0.31949E-02 -0.105E-03 1 + 38 6 74904.41 -0.29149E+00 -0.91021E-03 -0.18183E-02 0.31949E-02 -0.105E-03 1 + 38 6 74910.53 -0.29706E+00 -0.98108E-03 0.17756E-01 0.31949E-02 -0.105E-03 1 + 38 6 74910.53 -0.29706E+00 -0.98108E-03 0.17756E-01 0.31949E-02 -0.105E-03 1 + 38 6 74920.07 -0.30642E+00 -0.10519E-02 0.48214E-01 0.31949E-02 -0.105E-03 1 + 38 6 74920.07 -0.30642E+00 -0.10519E-02 0.48214E-01 0.31949E-02 -0.105E-03 1 + 38 6 74926.19 -0.31286E+00 -0.11228E-02 0.67789E-01 0.31949E-02 -0.105E-03 1 + 38 6 74926.19 -0.31286E+00 -0.11228E-02 0.67789E-01 0.31949E-02 -0.105E-03 1 + 38 6 74935.73 -0.32356E+00 -0.11937E-02 0.98246E-01 0.31949E-02 -0.105E-03 1 + 38 6 74935.73 -0.32356E+00 -0.11937E-02 0.98246E-01 0.31949E-02 -0.105E-03 1 + 38 6 74947.71 -0.33787E+00 -0.42867E-02 0.13654E+00 0.19449E-02 -0.105E-03 1 + 38 6 74947.71 -0.33787E+00 -0.42867E-02 0.13654E+00 0.19449E-02 -0.105E-03 1 + 38 6 74955.45 -0.37102E+00 -0.76832E-02 0.15158E+00 0.55728E-03 -0.105E-03 1 + 38 6 74955.45 -0.37102E+00 -0.76832E-02 0.15158E+00 0.55728E-03 -0.105E-03 1 + 38 6 74963.43 -0.43239E+00 -0.77540E-02 0.15603E+00 0.55728E-03 -0.105E-03 1 + 38 6 74963.43 -0.43239E+00 -0.77540E-02 0.15603E+00 0.55728E-03 -0.105E-03 1 + 38 6 74972.97 -0.50631E+00 -0.78249E-02 0.16135E+00 0.55728E-03 -0.105E-03 1 + 38 6 74972.97 -0.50631E+00 -0.78249E-02 0.16135E+00 0.55728E-03 -0.105E-03 1 + 38 6 74979.09 -0.55425E+00 -0.78957E-02 0.16476E+00 0.55728E-03 -0.105E-03 1 + 38 6 74979.09 -0.55425E+00 -0.78957E-02 0.16476E+00 0.55728E-03 -0.105E-03 1 + 38 6 74988.63 -0.62952E+00 -0.79666E-02 0.17007E+00 0.55728E-03 -0.105E-03 1 + 38 6 74988.63 -0.62952E+00 -0.79666E-02 0.17007E+00 0.55728E-03 -0.105E-03 1 + 38 6 74994.75 -0.67833E+00 -0.80374E-02 0.17349E+00 0.55728E-03 -0.105E-03 1 + 38 6 74994.75 -0.67833E+00 -0.80374E-02 0.17349E+00 0.55728E-03 -0.105E-03 1 + 38 6 75004.29 -0.75496E+00 -0.81083E-02 0.17880E+00 0.55728E-03 -0.105E-03 1 + 38 6 75004.29 -0.75496E+00 -0.81083E-02 0.17880E+00 0.55728E-03 -0.105E-03 1 + 38 6 75010.41 -0.80463E+00 -0.81791E-02 0.18222E+00 0.55728E-03 -0.105E-03 1 + 38 6 75010.41 -0.80463E+00 -0.81791E-02 0.18222E+00 0.55728E-03 -0.105E-03 1 + 38 6 75019.95 -0.88261E+00 -0.82499E-02 0.18753E+00 0.55728E-03 -0.105E-03 1 + 38 6 75019.95 -0.88261E+00 -0.82499E-02 0.18753E+00 0.55728E-03 -0.105E-03 1 + 38 6 75055.36 -0.11748E+01 -0.77173E-02 0.20726E+00 0.65124E-03 -0.105E-03 1 + 38 6 75055.36 -0.11748E+01 -0.77173E-02 0.20726E+00 0.65124E-03 -0.105E-03 1 + 38 6 75056.70 -0.11851E+01 -0.71801E-02 0.20813E+00 0.74560E-03 -0.105E-03 1 + 38 6 75056.70 -0.11851E+01 -0.71801E-02 0.20813E+00 0.74560E-03 -0.105E-03 1 + 38 6 75058.32 -0.11968E+01 0.99428E-03 0.20935E+00 0.21755E-02 -0.105E-03 1 + 38 6 75058.32 -0.11968E+01 0.99428E-03 0.20935E+00 0.21755E-02 -0.105E-03 1 + 38 6 75062.32 -0.11928E+01 0.91415E-02 0.21805E+00 0.36649E-02 -0.105E-03 1 + 38 6 75062.32 -0.11928E+01 0.91415E-02 0.21805E+00 0.36649E-02 -0.105E-03 1 + 38 6 75069.38 -0.11283E+01 0.90707E-02 0.24391E+00 0.36649E-02 -0.105E-03 1 + 38 6 75069.38 -0.11283E+01 0.90707E-02 0.24391E+00 0.36649E-02 -0.105E-03 1 + 38 6 75078.91 -0.10418E+01 0.89998E-02 0.27885E+00 0.36649E-02 -0.105E-03 1 + 38 6 75078.91 -0.10418E+01 0.89998E-02 0.27885E+00 0.36649E-02 -0.105E-03 1 + 38 6 75085.04 -0.98668E+00 0.89290E-02 0.30130E+00 0.36649E-02 -0.105E-03 1 + 38 6 75085.04 -0.98668E+00 0.89290E-02 0.30130E+00 0.36649E-02 -0.105E-03 1 + 38 6 75094.57 -0.90156E+00 0.88582E-02 0.33624E+00 0.36649E-02 -0.105E-03 1 + 38 6 75094.57 -0.90156E+00 0.88582E-02 0.33624E+00 0.36649E-02 -0.105E-03 1 + 38 6 75100.70 -0.84728E+00 0.87874E-02 0.35869E+00 0.36649E-02 -0.105E-03 1 + 38 6 75100.70 -0.84728E+00 0.87874E-02 0.35869E+00 0.36649E-02 -0.105E-03 1 + 38 6 75110.23 -0.76351E+00 0.87165E-02 0.39363E+00 0.36649E-02 -0.105E-03 1 + 38 6 75110.23 -0.76351E+00 0.87165E-02 0.39363E+00 0.36649E-02 -0.105E-03 1 + 38 6 75116.36 -0.71011E+00 0.86457E-02 0.41608E+00 0.36649E-02 -0.105E-03 1 + 38 6 75116.36 -0.71011E+00 0.86457E-02 0.41608E+00 0.36649E-02 -0.105E-03 1 + 38 6 75125.89 -0.62768E+00 0.85748E-02 0.45102E+00 0.36649E-02 -0.105E-03 1 + 38 6 75125.89 -0.62768E+00 0.85748E-02 0.45102E+00 0.36649E-02 -0.105E-03 1 + 38 6 75132.02 -0.57515E+00 0.85040E-02 0.47348E+00 0.36649E-02 -0.105E-03 1 + 38 6 75132.02 -0.57515E+00 0.85040E-02 0.47348E+00 0.36649E-02 -0.105E-03 1 + 38 6 75141.55 -0.49408E+00 0.84331E-02 0.50842E+00 0.36649E-02 -0.105E-03 1 + 38 6 75141.55 -0.49408E+00 0.84331E-02 0.50842E+00 0.36649E-02 -0.105E-03 1 + 38 6 75147.68 -0.44241E+00 0.83623E-02 0.53087E+00 0.36649E-02 -0.105E-03 1 + 38 6 75147.68 -0.44241E+00 0.83623E-02 0.53087E+00 0.36649E-02 -0.105E-03 1 + 38 6 75157.21 -0.36269E+00 0.82914E-02 0.56581E+00 0.36649E-02 -0.105E-03 1 + 38 6 75157.21 -0.36269E+00 0.82914E-02 0.56581E+00 0.36649E-02 -0.105E-03 1 + 38 6 75161.31 -0.32874E+00 0.82094E-02 0.58081E+00 0.35200E-02 -0.105E-03 1 + 38 6 75161.31 -0.32874E+00 0.82094E-02 0.58081E+00 0.35200E-02 -0.105E-03 1 + 38 6 75162.64 -0.31780E+00 0.81302E-02 0.58551E+00 0.33740E-02 -0.105E-03 1 + 38 6 75162.64 -0.31780E+00 0.81302E-02 0.58551E+00 0.33740E-02 -0.105E-03 1 + 38 6 75164.27 -0.30456E+00 0.60590E-02 0.59100E+00 -0.64505E-03 -0.105E-03 1 + 38 6 75164.27 -0.30456E+00 0.60590E-02 0.59100E+00 -0.64505E-03 -0.105E-03 1 + 38 6 75168.27 -0.28032E+00 0.41527E-02 0.58842E+00 -0.46466E-02 -0.105E-03 1 + 38 6 75168.27 -0.28032E+00 0.41527E-02 0.58842E+00 -0.46466E-02 -0.105E-03 1 + 38 6 75175.33 -0.25102E+00 0.40818E-02 0.55564E+00 -0.46466E-02 -0.105E-03 1 + 38 6 75175.33 -0.25102E+00 0.40818E-02 0.55564E+00 -0.46466E-02 -0.105E-03 1 + 38 6 75184.86 -0.21211E+00 0.40109E-02 0.51134E+00 -0.46466E-02 -0.105E-03 1 + 38 6 75184.86 -0.21211E+00 0.40109E-02 0.51134E+00 -0.46466E-02 -0.105E-03 1 + 38 6 75190.99 -0.18754E+00 0.39401E-02 0.48287E+00 -0.46466E-02 -0.105E-03 1 + 38 6 75190.99 -0.18754E+00 0.39401E-02 0.48287E+00 -0.46466E-02 -0.105E-03 1 + 38 6 75200.52 -0.14997E+00 0.38692E-02 0.43857E+00 -0.46466E-02 -0.105E-03 1 + 38 6 75200.52 -0.14997E+00 0.38692E-02 0.43857E+00 -0.46466E-02 -0.105E-03 1 + 38 6 75206.65 -0.12627E+00 0.37983E-02 0.41010E+00 -0.46466E-02 -0.105E-03 1 + 38 6 75206.65 -0.12627E+00 0.37983E-02 0.41010E+00 -0.46466E-02 -0.105E-03 1 + 38 6 75216.18 -0.90057E-01 0.37274E-02 0.36580E+00 -0.46466E-02 -0.105E-03 1 + 38 6 75216.18 -0.90057E-01 0.37274E-02 0.36580E+00 -0.46466E-02 -0.105E-03 1 + 38 6 75222.31 -0.67220E-01 0.36565E-02 0.33734E+00 -0.46466E-02 -0.105E-03 1 + 38 6 75222.31 -0.67220E-01 0.36565E-02 0.33734E+00 -0.46466E-02 -0.105E-03 1 + 38 6 75231.84 -0.32360E-01 0.35857E-02 0.29304E+00 -0.46466E-02 -0.105E-03 1 + 38 6 75231.84 -0.32360E-01 0.35857E-02 0.29304E+00 -0.46466E-02 -0.105E-03 1 + 38 6 75237.97 -0.10392E-01 0.35148E-02 0.26457E+00 -0.46466E-02 -0.105E-03 1 + 38 6 75237.97 -0.10392E-01 0.35148E-02 0.26457E+00 -0.46466E-02 -0.105E-03 1 + 38 6 75247.50 0.23116E-01 0.34439E-02 0.22027E+00 -0.46466E-02 -0.105E-03 1 + 38 6 75247.50 0.23116E-01 0.34439E-02 0.22027E+00 -0.46466E-02 -0.105E-03 1 + 38 6 75253.63 0.44216E-01 0.33730E-02 0.19180E+00 -0.46466E-02 -0.105E-03 1 + 38 6 75253.63 0.44216E-01 0.33730E-02 0.19180E+00 -0.46466E-02 -0.105E-03 1 + 38 6 75263.16 0.76372E-01 0.33021E-02 0.14751E+00 -0.46466E-02 -0.105E-03 1 + 38 6 75263.16 0.76372E-01 0.33021E-02 0.14751E+00 -0.46466E-02 -0.105E-03 1 + 38 6 75267.25 0.89890E-01 0.32756E-02 0.12848E+00 -0.46088E-02 -0.105E-03 1 + 38 6 75267.25 0.89890E-01 0.32756E-02 0.12848E+00 -0.46088E-02 -0.105E-03 1 + 38 6 75268.59 0.94258E-01 0.32479E-02 0.12234E+00 -0.45727E-02 -0.105E-03 1 + 38 6 75268.59 0.94258E-01 0.32479E-02 0.12234E+00 -0.45727E-02 -0.105E-03 1 + 38 6 75270.22 0.99546E-01 0.25680E-02 0.11489E+00 -0.37880E-02 -0.105E-03 1 + 38 6 75270.22 0.99546E-01 0.25680E-02 0.11489E+00 -0.37880E-02 -0.105E-03 1 + 38 6 75274.22 0.10982E+00 0.18179E-02 0.99740E-01 -0.31067E-02 -0.105E-03 1 + 38 6 75274.22 0.10982E+00 0.18179E-02 0.99740E-01 -0.31067E-02 -0.105E-03 1 + 38 6 75275.92 0.11291E+00 0.18178E-02 0.94459E-01 -0.31066E-02 -0.105E-03 1 + 38 6 75275.92 0.11291E+00 0.18178E-02 0.94459E-01 -0.31066E-02 -0.105E-03 1 + 38 6 75276.72 0.11436E+00 0.18178E-02 0.91974E-01 -0.31065E-02 -0.105E-03 1 + 38 6 75276.72 0.11436E+00 0.18178E-02 0.91974E-01 -0.31065E-02 -0.105E-03 1 + 38 6 75281.27 0.12264E+00 0.17469E-02 0.77822E-01 -0.31065E-02 -0.105E-03 1 + 38 6 75281.27 0.12264E+00 0.17469E-02 0.77822E-01 -0.31065E-02 -0.105E-03 1 + 38 6 75290.80 0.13930E+00 0.16760E-02 0.48207E-01 -0.31065E-02 -0.105E-03 1 + 38 6 75290.80 0.13930E+00 0.16760E-02 0.48207E-01 -0.31065E-02 -0.105E-03 1 + 38 6 75296.93 0.14957E+00 0.16051E-02 0.29174E-01 -0.31065E-02 -0.105E-03 1 + 38 6 75296.93 0.14957E+00 0.16051E-02 0.29174E-01 -0.31065E-02 -0.105E-03 1 + 38 6 75306.46 0.16487E+00 0.15342E-02 -0.44039E-03 -0.31065E-02 -0.105E-03 1 + 38 6 75306.46 0.16487E+00 0.15342E-02 -0.44039E-03 -0.31065E-02 -0.105E-03 1 + 38 6 75312.59 0.17427E+00 0.14633E-02 -0.19473E-01 -0.31065E-02 -0.105E-03 1 + 38 6 75312.59 0.17427E+00 0.14633E-02 -0.19473E-01 -0.31065E-02 -0.105E-03 1 + 38 6 75322.12 0.18822E+00 0.13924E-02 -0.49088E-01 -0.31065E-02 -0.105E-03 1 + 38 6 75322.12 0.18822E+00 0.13924E-02 -0.49088E-01 -0.31065E-02 -0.105E-03 1 + 38 6 75328.25 0.19675E+00 0.13215E-02 -0.68121E-01 -0.31065E-02 -0.105E-03 1 + 38 6 75328.25 0.19675E+00 0.13215E-02 -0.68121E-01 -0.31065E-02 -0.105E-03 1 + 38 6 75337.78 0.20935E+00 0.12506E-02 -0.97736E-01 -0.31065E-02 -0.105E-03 1 + 38 6 75337.78 0.20935E+00 0.12506E-02 -0.97736E-01 -0.31065E-02 -0.105E-03 1 + 38 6 75343.91 0.21701E+00 0.11797E-02 -0.11677E+00 -0.31065E-02 -0.105E-03 1 + 38 6 75343.91 0.21701E+00 0.11797E-02 -0.11677E+00 -0.31065E-02 -0.105E-03 1 + 38 6 75353.44 0.22826E+00 0.11088E-02 -0.14638E+00 -0.31065E-02 -0.105E-03 1 + 38 6 75353.44 0.22826E+00 0.11088E-02 -0.14638E+00 -0.31065E-02 -0.105E-03 1 + 38 6 75359.57 0.23505E+00 0.10379E-02 -0.16542E+00 -0.31065E-02 -0.105E-03 1 + 38 6 75359.57 0.23505E+00 0.10379E-02 -0.16542E+00 -0.31065E-02 -0.105E-03 1 + 38 6 75369.11 0.24494E+00 0.96700E-03 -0.19503E+00 -0.31065E-02 -0.105E-03 1 + 38 6 75369.11 0.24494E+00 0.96700E-03 -0.19503E+00 -0.31065E-02 -0.105E-03 1 + 38 6 75376.16 0.25177E+00 0.26791E-02 -0.21695E+00 -0.16311E-02 -0.105E-03 1 + 38 6 75376.16 0.25177E+00 0.26791E-02 -0.21695E+00 -0.16311E-02 -0.105E-03 1 + 38 6 75380.16 0.26248E+00 0.44642E-02 -0.22347E+00 -0.11138E-03 -0.105E-03 1 + 38 6 75380.16 0.26248E+00 0.44642E-02 -0.22347E+00 -0.11138E-03 -0.105E-03 1 + 38 6 75381.86 0.27007E+00 0.44645E-02 -0.22366E+00 -0.10982E-03 -0.105E-03 1 + 38 6 75381.86 0.27007E+00 0.44645E-02 -0.22366E+00 -0.10982E-03 -0.105E-03 1 + 38 6 75382.66 0.27364E+00 0.44648E-02 -0.22375E+00 -0.10824E-03 -0.105E-03 1 + 38 6 75382.66 0.27364E+00 0.44648E-02 -0.22375E+00 -0.10824E-03 -0.105E-03 1 + 38 6 75387.22 0.29398E+00 0.43939E-02 -0.22424E+00 -0.10824E-03 -0.105E-03 1 + 38 6 75387.22 0.29398E+00 0.43939E-02 -0.22424E+00 -0.10824E-03 -0.105E-03 1 + 38 6 75396.75 0.33587E+00 0.43230E-02 -0.22528E+00 -0.10824E-03 -0.105E-03 1 + 38 6 75396.75 0.33587E+00 0.43230E-02 -0.22528E+00 -0.10824E-03 -0.105E-03 1 + 38 6 75402.88 0.36236E+00 0.42521E-02 -0.22594E+00 -0.10824E-03 -0.105E-03 1 + 38 6 75402.88 0.36236E+00 0.42521E-02 -0.22594E+00 -0.10824E-03 -0.105E-03 1 + 38 6 75412.41 0.40289E+00 0.41811E-02 -0.22697E+00 -0.10824E-03 -0.105E-03 1 + 38 6 75412.41 0.40289E+00 0.41811E-02 -0.22697E+00 -0.10824E-03 -0.105E-03 1 + 38 6 75418.54 0.42851E+00 0.41102E-02 -0.22763E+00 -0.10824E-03 -0.105E-03 1 + 38 6 75418.54 0.42851E+00 0.41102E-02 -0.22763E+00 -0.10824E-03 -0.105E-03 1 + 38 6 75428.07 0.46770E+00 0.40393E-02 -0.22867E+00 -0.10824E-03 -0.105E-03 1 + 38 6 75428.07 0.46770E+00 0.40393E-02 -0.22867E+00 -0.10824E-03 -0.105E-03 1 + 38 6 75434.20 0.49244E+00 0.39684E-02 -0.22933E+00 -0.10824E-03 -0.105E-03 1 + 38 6 75434.20 0.49244E+00 0.39684E-02 -0.22933E+00 -0.10824E-03 -0.105E-03 1 + 38 6 75443.73 0.53028E+00 0.38975E-02 -0.23036E+00 -0.10824E-03 -0.105E-03 1 + 38 6 75443.73 0.53028E+00 0.38975E-02 -0.23036E+00 -0.10824E-03 -0.105E-03 1 + 38 6 75449.86 0.55416E+00 0.38265E-02 -0.23102E+00 -0.10824E-03 -0.105E-03 1 + 38 6 75449.86 0.55416E+00 0.38265E-02 -0.23102E+00 -0.10824E-03 -0.105E-03 1 + 38 6 75459.39 0.59064E+00 0.37556E-02 -0.23206E+00 -0.10824E-03 -0.105E-03 1 + 38 6 75459.39 0.59064E+00 0.37556E-02 -0.23206E+00 -0.10824E-03 -0.105E-03 1 + 38 6 75465.52 0.61365E+00 0.36847E-02 -0.23272E+00 -0.10824E-03 -0.105E-03 1 + 38 6 75465.52 0.61365E+00 0.36847E-02 -0.23272E+00 -0.10824E-03 -0.105E-03 1 + 38 6 75475.05 0.64877E+00 0.36138E-02 -0.23375E+00 -0.10824E-03 -0.105E-03 1 + 38 6 75475.05 0.64877E+00 0.36138E-02 -0.23375E+00 -0.10824E-03 -0.105E-03 1 + 38 6 75482.11 0.67427E+00 -0.99175E-03 -0.23451E+00 -0.17101E-02 -0.105E-03 1 + 38 6 75482.11 0.67427E+00 -0.99175E-03 -0.23451E+00 -0.17101E-02 -0.105E-03 1 + 38 6 75486.11 0.67030E+00 -0.55702E-02 -0.24135E+00 -0.33586E-02 -0.105E-03 1 + 38 6 75486.11 0.67030E+00 -0.55702E-02 -0.24135E+00 -0.33586E-02 -0.105E-03 1 + 38 6 75487.81 0.66083E+00 -0.55726E-02 -0.24706E+00 -0.33607E-02 -0.105E-03 1 + 38 6 75487.81 0.66083E+00 -0.55726E-02 -0.24706E+00 -0.33607E-02 -0.105E-03 1 + 38 6 75488.61 0.65638E+00 -0.55749E-02 -0.24975E+00 -0.33628E-02 -0.105E-03 1 + 38 6 75488.61 0.65638E+00 -0.55749E-02 -0.24975E+00 -0.33628E-02 -0.105E-03 1 + 38 6 75493.16 0.63098E+00 -0.56459E-02 -0.26507E+00 -0.33628E-02 -0.105E-03 1 + 38 6 75493.16 0.63098E+00 -0.56459E-02 -0.26507E+00 -0.33628E-02 -0.105E-03 1 + 38 6 75502.69 0.57715E+00 -0.57168E-02 -0.29713E+00 -0.33628E-02 -0.105E-03 1 + 38 6 75502.69 0.57715E+00 -0.57168E-02 -0.29713E+00 -0.33628E-02 -0.105E-03 1 + 38 6 75508.82 0.54213E+00 -0.57877E-02 -0.31773E+00 -0.33628E-02 -0.105E-03 1 + 38 6 75508.82 0.54213E+00 -0.57877E-02 -0.31773E+00 -0.33628E-02 -0.105E-03 1 + 38 6 75518.35 0.48695E+00 -0.58586E-02 -0.34979E+00 -0.33628E-02 -0.105E-03 1 + 38 6 75518.35 0.48695E+00 -0.58586E-02 -0.34979E+00 -0.33628E-02 -0.105E-03 1 + 38 6 75524.48 0.45106E+00 -0.59295E-02 -0.37040E+00 -0.33628E-02 -0.105E-03 1 + 38 6 75524.48 0.45106E+00 -0.59295E-02 -0.37040E+00 -0.33628E-02 -0.105E-03 1 + 38 6 75534.01 0.39453E+00 -0.60005E-02 -0.40245E+00 -0.33628E-02 -0.105E-03 1 + 38 6 75534.01 0.39453E+00 -0.60005E-02 -0.40245E+00 -0.33628E-02 -0.105E-03 1 + 38 6 75540.14 0.35777E+00 -0.60714E-02 -0.42306E+00 -0.33628E-02 -0.105E-03 1 + 38 6 75540.14 0.35777E+00 -0.60714E-02 -0.42306E+00 -0.33628E-02 -0.105E-03 1 + 38 6 75549.68 0.29989E+00 -0.61423E-02 -0.45512E+00 -0.33628E-02 -0.105E-03 1 + 38 6 75549.68 0.29989E+00 -0.61423E-02 -0.45512E+00 -0.33628E-02 -0.105E-03 1 + 38 6 75555.80 0.26225E+00 -0.62132E-02 -0.47572E+00 -0.33628E-02 -0.105E-03 1 + 38 6 75555.80 0.26225E+00 -0.62132E-02 -0.47572E+00 -0.33628E-02 -0.105E-03 1 + 38 6 75565.34 0.20302E+00 -0.62841E-02 -0.50778E+00 -0.33628E-02 -0.105E-03 1 + 38 6 75565.34 0.20302E+00 -0.62841E-02 -0.50778E+00 -0.33628E-02 -0.105E-03 1 + 38 6 75571.46 0.16452E+00 -0.63550E-02 -0.52838E+00 -0.33628E-02 -0.105E-03 1 + 38 6 75571.46 0.16452E+00 -0.63550E-02 -0.52838E+00 -0.33628E-02 -0.105E-03 1 + 38 6 75581.00 0.10394E+00 -0.64259E-02 -0.56044E+00 -0.33628E-02 -0.105E-03 1 + 38 6 75581.00 0.10394E+00 -0.64259E-02 -0.56044E+00 -0.33628E-02 -0.105E-03 1 + 38 6 75588.05 0.58597E-01 -0.60274E-02 -0.58417E+00 0.60982E-03 -0.105E-03 1 + 38 6 75588.05 0.58597E-01 -0.60274E-02 -0.58417E+00 0.60982E-03 -0.105E-03 1 + 38 6 75592.05 0.34488E-01 -0.57928E-02 -0.58173E+00 0.45658E-02 -0.105E-03 1 + 38 6 75592.05 0.34488E-01 -0.57928E-02 -0.58173E+00 0.45658E-02 -0.105E-03 1 + 38 6 75593.75 0.24640E-01 -0.57971E-02 -0.57396E+00 0.45662E-02 -0.105E-03 1 + 38 6 75593.75 0.24640E-01 -0.57971E-02 -0.57396E+00 0.45662E-02 -0.105E-03 1 + 38 6 75594.55 0.20002E-01 -0.58013E-02 -0.57031E+00 0.45665E-02 -0.105E-03 1 + 38 6 75594.55 0.20002E-01 -0.58013E-02 -0.57031E+00 0.45665E-02 -0.105E-03 1 + 38 6 75599.11 -0.64253E-02 -0.58722E-02 -0.54951E+00 0.45665E-02 -0.105E-03 1 + 38 6 75599.11 -0.64253E-02 -0.58722E-02 -0.54951E+00 0.45665E-02 -0.105E-03 1 + 38 6 75608.64 -0.62407E-01 -0.59430E-02 -0.50597E+00 0.45665E-02 -0.105E-03 1 + 38 6 75608.64 -0.62407E-01 -0.59430E-02 -0.50597E+00 0.45665E-02 -0.105E-03 1 + 38 6 75614.77 -0.98819E-01 -0.60139E-02 -0.47800E+00 0.45665E-02 -0.105E-03 1 + 38 6 75614.77 -0.98819E-01 -0.60139E-02 -0.47800E+00 0.45665E-02 -0.105E-03 1 + 38 6 75624.30 -0.15615E+00 -0.60848E-02 -0.43446E+00 0.45665E-02 -0.105E-03 1 + 38 6 75624.30 -0.15615E+00 -0.60848E-02 -0.43446E+00 0.45665E-02 -0.105E-03 1 + 38 6 75630.43 -0.19343E+00 -0.61557E-02 -0.40648E+00 0.45665E-02 -0.105E-03 1 + 38 6 75630.43 -0.19343E+00 -0.61557E-02 -0.40648E+00 0.45665E-02 -0.105E-03 1 + 38 6 75639.96 -0.25212E+00 -0.62265E-02 -0.36295E+00 0.45665E-02 -0.105E-03 1 + 38 6 75639.96 -0.25212E+00 -0.62265E-02 -0.36295E+00 0.45665E-02 -0.105E-03 1 + 38 6 75646.09 -0.29027E+00 -0.62974E-02 -0.33497E+00 0.45665E-02 -0.105E-03 1 + 38 6 75646.09 -0.29027E+00 -0.62974E-02 -0.33497E+00 0.45665E-02 -0.105E-03 1 + 38 6 75655.62 -0.35030E+00 -0.63683E-02 -0.29144E+00 0.45665E-02 -0.105E-03 1 + 38 6 75655.62 -0.35030E+00 -0.63683E-02 -0.29144E+00 0.45665E-02 -0.105E-03 1 + 38 6 75661.75 -0.38932E+00 -0.64391E-02 -0.26346E+00 0.45665E-02 -0.105E-03 1 + 38 6 75661.75 -0.38932E+00 -0.64391E-02 -0.26346E+00 0.45665E-02 -0.105E-03 1 + 38 6 75671.28 -0.45070E+00 -0.65100E-02 -0.21993E+00 0.45665E-02 -0.105E-03 1 + 38 6 75671.28 -0.45070E+00 -0.65100E-02 -0.21993E+00 0.45665E-02 -0.105E-03 1 + 38 6 75677.41 -0.49059E+00 -0.65809E-02 -0.19195E+00 0.45665E-02 -0.105E-03 1 + 38 6 75677.41 -0.49059E+00 -0.65809E-02 -0.19195E+00 0.45665E-02 -0.105E-03 1 + 38 6 75686.94 -0.55333E+00 -0.66517E-02 -0.14841E+00 0.45665E-02 -0.105E-03 1 + 38 6 75686.94 -0.55333E+00 -0.66517E-02 -0.14841E+00 0.45665E-02 -0.105E-03 1 + 38 6 75694.00 -0.60026E+00 -0.25517E-02 -0.11619E+00 0.37728E-02 -0.105E-03 1 + 38 6 75694.00 -0.60026E+00 -0.25517E-02 -0.11619E+00 0.37728E-02 -0.105E-03 1 + 38 6 75698.00 -0.61047E+00 0.16180E-02 -0.10110E+00 0.30823E-02 -0.105E-03 1 + 38 6 75698.00 -0.61047E+00 0.16180E-02 -0.10110E+00 0.30823E-02 -0.105E-03 1 + 38 6 75699.70 -0.60772E+00 0.16157E-02 -0.95864E-01 0.30830E-02 -0.105E-03 1 + 38 6 75699.70 -0.60772E+00 0.16157E-02 -0.95864E-01 0.30830E-02 -0.105E-03 1 + 38 6 75700.50 -0.60642E+00 0.16134E-02 -0.93397E-01 0.30837E-02 -0.105E-03 1 + 38 6 75700.50 -0.60642E+00 0.16134E-02 -0.93397E-01 0.30837E-02 -0.105E-03 1 + 38 6 75705.05 -0.59907E+00 0.15425E-02 -0.79349E-01 0.30837E-02 -0.105E-03 1 + 38 6 75705.05 -0.59907E+00 0.15425E-02 -0.79349E-01 0.30837E-02 -0.105E-03 1 + 38 6 75714.58 -0.58437E+00 0.14717E-02 -0.49951E-01 0.30837E-02 -0.105E-03 1 + 38 6 75714.58 -0.58437E+00 0.14717E-02 -0.49951E-01 0.30837E-02 -0.105E-03 1 + 38 6 75720.71 -0.57535E+00 0.14008E-02 -0.31057E-01 0.30837E-02 -0.105E-03 1 + 38 6 75720.71 -0.57535E+00 0.14008E-02 -0.31057E-01 0.30837E-02 -0.105E-03 1 + 38 6 75730.25 -0.56200E+00 0.13300E-02 -0.16590E-02 0.30837E-02 -0.105E-03 1 + 38 6 75730.25 -0.56200E+00 0.13300E-02 -0.16590E-02 0.30837E-02 -0.105E-03 1 + 38 6 75736.37 -0.55385E+00 0.12591E-02 0.17235E-01 0.30837E-02 -0.105E-03 1 + 38 6 75736.37 -0.55385E+00 0.12591E-02 0.17235E-01 0.30837E-02 -0.105E-03 1 + 38 6 75745.91 -0.54184E+00 0.11883E-02 0.46633E-01 0.30837E-02 -0.105E-03 1 + 38 6 75745.91 -0.54184E+00 0.11883E-02 0.46633E-01 0.30837E-02 -0.105E-03 1 + 38 6 75752.03 -0.53456E+00 0.11174E-02 0.65526E-01 0.30837E-02 -0.105E-03 1 + 38 6 75752.03 -0.53456E+00 0.11174E-02 0.65526E-01 0.30837E-02 -0.105E-03 1 + 38 6 75761.57 -0.52391E+00 0.10466E-02 0.94925E-01 0.30837E-02 -0.105E-03 1 + 38 6 75761.57 -0.52391E+00 0.10466E-02 0.94925E-01 0.30837E-02 -0.105E-03 1 + 38 6 75767.69 -0.51750E+00 0.97572E-03 0.11382E+00 0.30837E-02 -0.105E-03 1 + 38 6 75767.69 -0.51750E+00 0.97572E-03 0.11382E+00 0.30837E-02 -0.105E-03 1 + 38 6 75777.23 -0.50820E+00 0.90486E-03 0.14322E+00 0.30837E-02 -0.105E-03 1 + 38 6 75777.23 -0.50820E+00 0.90486E-03 0.14322E+00 0.30837E-02 -0.105E-03 1 + 38 6 75783.35 -0.50265E+00 0.83400E-03 0.16211E+00 0.30837E-02 -0.105E-03 1 + 38 6 75783.35 -0.50265E+00 0.83400E-03 0.16211E+00 0.30837E-02 -0.105E-03 1 + 38 6 75792.89 -0.49470E+00 0.76315E-03 0.19151E+00 0.30837E-02 -0.105E-03 1 + 38 6 75792.89 -0.49470E+00 0.76315E-03 0.19151E+00 0.30837E-02 -0.105E-03 1 + 38 6 75799.94 -0.48932E+00 -0.25644E-02 0.21327E+00 0.16334E-02 -0.105E-03 1 + 38 6 75799.94 -0.48932E+00 -0.25644E-02 0.21327E+00 0.16334E-02 -0.105E-03 1 + 38 6 75803.94 -0.49958E+00 -0.59618E-02 0.21980E+00 0.13869E-03 -0.105E-03 1 + 38 6 75803.94 -0.49958E+00 -0.59618E-02 0.21980E+00 0.13869E-03 -0.105E-03 1 + 38 6 75805.64 -0.50971E+00 -0.59591E-02 0.22004E+00 0.14158E-03 -0.105E-03 1 + 38 6 75805.64 -0.50971E+00 -0.59591E-02 0.22004E+00 0.14158E-03 -0.105E-03 1 + 38 6 75806.44 -0.51448E+00 -0.59563E-02 0.22015E+00 0.14450E-03 -0.105E-03 1 + 38 6 75806.44 -0.51448E+00 -0.59563E-02 0.22015E+00 0.14450E-03 -0.105E-03 1 + 38 6 75811.00 -0.54161E+00 -0.60271E-02 0.22081E+00 0.14450E-03 -0.105E-03 1 + 38 6 75811.00 -0.54161E+00 -0.60271E-02 0.22081E+00 0.14450E-03 -0.105E-03 1 + 38 6 75820.53 -0.59907E+00 -0.60980E-02 0.22218E+00 0.14450E-03 -0.105E-03 1 + 38 6 75820.53 -0.59907E+00 -0.60980E-02 0.22218E+00 0.14450E-03 -0.105E-03 1 + 38 6 75826.66 -0.63643E+00 -0.61688E-02 0.22307E+00 0.14450E-03 -0.105E-03 1 + 38 6 75826.66 -0.63643E+00 -0.61688E-02 0.22307E+00 0.14450E-03 -0.105E-03 1 + 38 6 75836.19 -0.69524E+00 -0.62397E-02 0.22445E+00 0.14450E-03 -0.105E-03 1 + 38 6 75836.19 -0.69524E+00 -0.62397E-02 0.22445E+00 0.14450E-03 -0.105E-03 1 + 38 6 75842.32 -0.73347E+00 -0.63105E-02 0.22533E+00 0.14450E-03 -0.105E-03 1 + 38 6 75842.32 -0.73347E+00 -0.63105E-02 0.22533E+00 0.14450E-03 -0.105E-03 1 + 38 6 75851.85 -0.79363E+00 -0.63814E-02 0.22671E+00 0.14450E-03 -0.105E-03 1 + 38 6 75851.85 -0.79363E+00 -0.63814E-02 0.22671E+00 0.14450E-03 -0.105E-03 1 + 38 6 75857.98 -0.83273E+00 -0.64522E-02 0.22760E+00 0.14450E-03 -0.105E-03 1 + 38 6 75857.98 -0.83273E+00 -0.64522E-02 0.22760E+00 0.14450E-03 -0.105E-03 1 + 38 6 75867.51 -0.89424E+00 -0.65230E-02 0.22897E+00 0.14450E-03 -0.105E-03 1 + 38 6 75867.51 -0.89424E+00 -0.65230E-02 0.22897E+00 0.14450E-03 -0.105E-03 1 + 38 6 75873.64 -0.93420E+00 -0.65939E-02 0.22986E+00 0.14450E-03 -0.105E-03 1 + 38 6 75873.64 -0.93420E+00 -0.65939E-02 0.22986E+00 0.14450E-03 -0.105E-03 1 + 38 6 75883.17 -0.99707E+00 -0.66647E-02 0.23124E+00 0.14450E-03 -0.105E-03 1 + 38 6 75883.17 -0.99707E+00 -0.66647E-02 0.23124E+00 0.14450E-03 -0.105E-03 1 + 38 6 75889.30 -0.10379E+01 -0.67355E-02 0.23212E+00 0.14450E-03 -0.105E-03 1 + 38 6 75889.30 -0.10379E+01 -0.67355E-02 0.23212E+00 0.14450E-03 -0.105E-03 1 + 38 6 75898.83 -0.11021E+01 -0.68063E-02 0.23350E+00 0.14450E-03 -0.105E-03 1 + 38 6 75898.83 -0.11021E+01 -0.68063E-02 0.23350E+00 0.14450E-03 -0.105E-03 1 + 38 6 75905.89 -0.11501E+01 0.10495E-02 0.23452E+00 0.17463E-02 -0.105E-03 1 + 38 6 75905.89 -0.11501E+01 0.10495E-02 0.23452E+00 0.17463E-02 -0.105E-03 1 + 38 6 75909.89 -0.11459E+01 0.88767E-02 0.24150E+00 0.33959E-02 -0.105E-03 1 + 38 6 75909.89 -0.11459E+01 0.88767E-02 0.24150E+00 0.33959E-02 -0.105E-03 1 + 38 6 75911.59 -0.11308E+01 0.88689E-02 0.24728E+00 0.33923E-02 -0.105E-03 1 + 38 6 75911.59 -0.11308E+01 0.88689E-02 0.24728E+00 0.33923E-02 -0.105E-03 1 + 38 6 75912.39 -0.11237E+01 0.88612E-02 0.24999E+00 0.33887E-02 -0.105E-03 1 + 38 6 75912.39 -0.11237E+01 0.88612E-02 0.24999E+00 0.33887E-02 -0.105E-03 1 + 38 6 75916.94 -0.10834E+01 0.87904E-02 0.26543E+00 0.33887E-02 -0.105E-03 1 + 38 6 75916.94 -0.10834E+01 0.87904E-02 0.26543E+00 0.33887E-02 -0.105E-03 1 + 38 6 75926.48 -0.99958E+00 0.87196E-02 0.29773E+00 0.33887E-02 -0.105E-03 1 + 38 6 75926.48 -0.99958E+00 0.87196E-02 0.29773E+00 0.33887E-02 -0.105E-03 1 + 38 6 75932.60 -0.94616E+00 0.86487E-02 0.31850E+00 0.33887E-02 -0.105E-03 1 + 38 6 75932.60 -0.94616E+00 0.86487E-02 0.31850E+00 0.33887E-02 -0.105E-03 1 + 38 6 75942.14 -0.86371E+00 0.85779E-02 0.35080E+00 0.33887E-02 -0.105E-03 1 + 38 6 75942.14 -0.86371E+00 0.85779E-02 0.35080E+00 0.33887E-02 -0.105E-03 1 + 38 6 75948.26 -0.81115E+00 0.85071E-02 0.37156E+00 0.33887E-02 -0.105E-03 1 + 38 6 75948.26 -0.81115E+00 0.85071E-02 0.37156E+00 0.33887E-02 -0.105E-03 1 + 38 6 75957.80 -0.73005E+00 0.84362E-02 0.40387E+00 0.33887E-02 -0.105E-03 1 + 38 6 75957.80 -0.73005E+00 0.84362E-02 0.40387E+00 0.33887E-02 -0.105E-03 1 + 38 6 75963.92 -0.67836E+00 0.83654E-02 0.42463E+00 0.33887E-02 -0.105E-03 1 + 38 6 75963.92 -0.67836E+00 0.83654E-02 0.42463E+00 0.33887E-02 -0.105E-03 1 + 38 6 75973.46 -0.59861E+00 0.82945E-02 0.45694E+00 0.33887E-02 -0.105E-03 1 + 38 6 75973.46 -0.59861E+00 0.82945E-02 0.45694E+00 0.33887E-02 -0.105E-03 1 + 38 6 75979.58 -0.54779E+00 0.82237E-02 0.47770E+00 0.33887E-02 -0.105E-03 1 + 38 6 75979.58 -0.54779E+00 0.82237E-02 0.47770E+00 0.33887E-02 -0.105E-03 1 + 38 6 75989.12 -0.46939E+00 0.81528E-02 0.51001E+00 0.33887E-02 -0.105E-03 1 + 38 6 75989.12 -0.46939E+00 0.81528E-02 0.51001E+00 0.33887E-02 -0.105E-03 1 + 38 6 75995.24 -0.41944E+00 0.80820E-02 0.53077E+00 0.33887E-02 -0.105E-03 1 + 38 6 75995.24 -0.41944E+00 0.80820E-02 0.53077E+00 0.33887E-02 -0.105E-03 1 + 38 6 76004.78 -0.34239E+00 0.80111E-02 0.56307E+00 0.33887E-02 -0.105E-03 1 + 38 6 76004.78 -0.34239E+00 0.80111E-02 0.56307E+00 0.33887E-02 -0.105E-03 1 + 38 6 76011.83 -0.28587E+00 0.60670E-02 0.58698E+00 -0.60304E-03 -0.105E-03 1 + 38 6 76011.83 -0.28587E+00 0.60670E-02 0.58698E+00 -0.60304E-03 -0.105E-03 1 + 38 6 76015.83 -0.26160E+00 0.42880E-02 0.58457E+00 -0.45784E-02 -0.105E-03 1 + 38 6 76015.83 -0.26160E+00 0.42880E-02 0.58457E+00 -0.45784E-02 -0.105E-03 1 + 38 6 76017.53 -0.25431E+00 0.42845E-02 0.57679E+00 -0.45746E-02 -0.105E-03 1 + 38 6 76017.53 -0.25431E+00 0.42845E-02 0.57679E+00 -0.45746E-02 -0.105E-03 1 + 38 6 76018.33 -0.25089E+00 0.42811E-02 0.57313E+00 -0.45709E-02 -0.105E-03 1 + 38 6 76018.33 -0.25089E+00 0.42811E-02 0.57313E+00 -0.45709E-02 -0.105E-03 1 + 38 6 76022.89 -0.23138E+00 0.42102E-02 0.55231E+00 -0.45709E-02 -0.105E-03 1 + 38 6 76022.89 -0.23138E+00 0.42102E-02 0.55231E+00 -0.45709E-02 -0.105E-03 1 + 38 6 76032.42 -0.19125E+00 0.41394E-02 0.50873E+00 -0.45709E-02 -0.105E-03 1 + 38 6 76032.42 -0.19125E+00 0.41394E-02 0.50873E+00 -0.45709E-02 -0.105E-03 1 + 38 6 76038.55 -0.16589E+00 0.40685E-02 0.48072E+00 -0.45709E-02 -0.105E-03 1 + 38 6 76038.55 -0.16589E+00 0.40685E-02 0.48072E+00 -0.45709E-02 -0.105E-03 1 + 38 6 76048.08 -0.12710E+00 0.39976E-02 0.43715E+00 -0.45709E-02 -0.105E-03 1 + 38 6 76048.08 -0.12710E+00 0.39976E-02 0.43715E+00 -0.45709E-02 -0.105E-03 1 + 38 6 76054.21 -0.10261E+00 0.39267E-02 0.40914E+00 -0.45709E-02 -0.105E-03 1 + 38 6 76054.21 -0.10261E+00 0.39267E-02 0.40914E+00 -0.45709E-02 -0.105E-03 1 + 38 6 76063.74 -0.65171E-01 0.38558E-02 0.36557E+00 -0.45709E-02 -0.105E-03 1 + 38 6 76063.74 -0.65171E-01 0.38558E-02 0.36557E+00 -0.45709E-02 -0.105E-03 1 + 38 6 76069.87 -0.41547E-01 0.37850E-02 0.33756E+00 -0.45709E-02 -0.105E-03 1 + 38 6 76069.87 -0.41547E-01 0.37850E-02 0.33756E+00 -0.45709E-02 -0.105E-03 1 + 38 6 76079.40 -0.54639E-02 0.37141E-02 0.29399E+00 -0.45709E-02 -0.105E-03 1 + 38 6 76079.40 -0.54639E-02 0.37141E-02 0.29399E+00 -0.45709E-02 -0.105E-03 1 + 38 6 76085.53 0.17292E-01 0.36432E-02 0.26598E+00 -0.45709E-02 -0.105E-03 1 + 38 6 76085.53 0.17292E-01 0.36432E-02 0.26598E+00 -0.45709E-02 -0.105E-03 1 + 38 6 76095.06 0.52023E-01 0.35723E-02 0.22240E+00 -0.45709E-02 -0.105E-03 1 + 38 6 76095.06 0.52023E-01 0.35723E-02 0.22240E+00 -0.45709E-02 -0.105E-03 1 + 38 6 76101.19 0.73910E-01 0.35014E-02 0.19440E+00 -0.45709E-02 -0.105E-03 1 + 38 6 76101.19 0.73910E-01 0.35014E-02 0.19440E+00 -0.45709E-02 -0.105E-03 1 + 38 6 76110.72 0.10729E+00 0.34305E-02 0.15082E+00 -0.45709E-02 -0.105E-03 1 + 38 6 76110.72 0.10729E+00 0.34305E-02 0.15082E+00 -0.45709E-02 -0.105E-03 1 + 38 6 76117.78 0.13149E+00 0.25324E-02 0.11857E+00 -0.37610E-02 -0.105E-03 1 + 38 6 76117.78 0.13149E+00 0.25324E-02 0.11857E+00 -0.37610E-02 -0.105E-03 1 + 38 6 76121.78 0.14162E+00 0.15650E-02 0.10353E+00 -0.30539E-02 -0.105E-03 1 + 38 6 76121.78 0.14162E+00 0.15650E-02 0.10353E+00 -0.30539E-02 -0.105E-03 1 + 38 6 76123.48 0.14428E+00 0.15649E-02 0.98337E-01 -0.30537E-02 -0.105E-03 1 + 38 6 76123.48 0.14428E+00 0.15649E-02 0.98337E-01 -0.30537E-02 -0.105E-03 1 + 38 6 76124.28 0.14554E+00 0.15649E-02 0.95894E-01 -0.30535E-02 -0.105E-03 1 + 38 6 76124.28 0.14554E+00 0.15649E-02 0.95894E-01 -0.30535E-02 -0.105E-03 1 + 38 6 76128.83 0.15266E+00 0.14940E-02 0.81983E-01 -0.30535E-02 -0.105E-03 1 + 38 6 76128.83 0.15266E+00 0.14940E-02 0.81983E-01 -0.30535E-02 -0.105E-03 1 + 38 6 76138.37 0.16691E+00 0.14231E-02 0.52873E-01 -0.30535E-02 -0.105E-03 1 + 38 6 76138.37 0.16691E+00 0.14231E-02 0.52873E-01 -0.30535E-02 -0.105E-03 1 + 38 6 76144.49 0.17563E+00 0.13522E-02 0.34165E-01 -0.30535E-02 -0.105E-03 1 + 38 6 76144.49 0.17563E+00 0.13522E-02 0.34165E-01 -0.30535E-02 -0.105E-03 1 + 38 6 76154.03 0.18852E+00 0.12813E-02 0.50544E-02 -0.30535E-02 -0.105E-03 1 + 38 6 76154.03 0.18852E+00 0.12813E-02 0.50544E-02 -0.30535E-02 -0.105E-03 1 + 38 6 76160.15 0.19637E+00 0.12104E-02 -0.13654E-01 -0.30535E-02 -0.105E-03 1 + 38 6 76160.15 0.19637E+00 0.12104E-02 -0.13654E-01 -0.30535E-02 -0.105E-03 1 + 38 6 76169.69 0.20791E+00 0.11395E-02 -0.42764E-01 -0.30535E-02 -0.105E-03 1 + 38 6 76169.69 0.20791E+00 0.11395E-02 -0.42764E-01 -0.30535E-02 -0.105E-03 1 + 38 6 76175.81 0.21489E+00 0.10686E-02 -0.61473E-01 -0.30535E-02 -0.105E-03 1 + 38 6 76175.81 0.21489E+00 0.10686E-02 -0.61473E-01 -0.30535E-02 -0.105E-03 1 + 38 6 76185.35 0.22507E+00 0.99767E-03 -0.90583E-01 -0.30535E-02 -0.105E-03 1 + 38 6 76185.35 0.22507E+00 0.99767E-03 -0.90583E-01 -0.30535E-02 -0.105E-03 1 + 38 6 76191.47 0.23119E+00 0.92676E-03 -0.10929E+00 -0.30535E-02 -0.105E-03 1 + 38 6 76191.47 0.23119E+00 0.92676E-03 -0.10929E+00 -0.30535E-02 -0.105E-03 1 + 38 6 76201.01 0.24002E+00 0.85586E-03 -0.13840E+00 -0.30535E-02 -0.105E-03 1 + 38 6 76201.01 0.24002E+00 0.85586E-03 -0.13840E+00 -0.30535E-02 -0.105E-03 1 + 38 6 76207.13 0.24527E+00 0.78496E-03 -0.15711E+00 -0.30535E-02 -0.105E-03 1 + 38 6 76207.13 0.24527E+00 0.78496E-03 -0.15711E+00 -0.30535E-02 -0.105E-03 1 + 38 6 76216.67 0.25275E+00 0.71405E-03 -0.18622E+00 -0.30535E-02 -0.105E-03 1 + 38 6 76216.67 0.25275E+00 0.71405E-03 -0.18622E+00 -0.30535E-02 -0.105E-03 1 + 38 6 76223.72 0.25779E+00 0.24671E-02 -0.20776E+00 -0.16406E-02 -0.105E-03 1 + 38 6 76223.72 0.25779E+00 0.24671E-02 -0.20776E+00 -0.16406E-02 -0.105E-03 1 + 38 6 76227.72 0.26766E+00 0.42873E-02 -0.21433E+00 -0.18310E-03 -0.105E-03 1 + 38 6 76227.72 0.26766E+00 0.42873E-02 -0.21433E+00 -0.18310E-03 -0.105E-03 1 + 38 6 76229.42 0.27494E+00 0.42877E-02 -0.21464E+00 -0.18158E-03 -0.105E-03 1 + 38 6 76229.42 0.27494E+00 0.42877E-02 -0.21464E+00 -0.18158E-03 -0.105E-03 1 + 38 6 76230.22 0.27837E+00 0.42881E-02 -0.21478E+00 -0.18003E-03 -0.105E-03 1 + 38 6 76230.22 0.27837E+00 0.42881E-02 -0.21478E+00 -0.18003E-03 -0.105E-03 1 + 38 6 76234.78 0.29791E+00 0.42172E-02 -0.21560E+00 -0.18003E-03 -0.105E-03 1 + 38 6 76234.78 0.29791E+00 0.42172E-02 -0.21560E+00 -0.18003E-03 -0.105E-03 1 + 38 6 76244.31 0.33811E+00 0.41463E-02 -0.21732E+00 -0.18003E-03 -0.105E-03 1 + 38 6 76244.31 0.33811E+00 0.41463E-02 -0.21732E+00 -0.18003E-03 -0.105E-03 1 + 38 6 76250.44 0.36352E+00 0.40754E-02 -0.21842E+00 -0.18003E-03 -0.105E-03 1 + 38 6 76250.44 0.36352E+00 0.40754E-02 -0.21842E+00 -0.18003E-03 -0.105E-03 1 + 38 6 76259.97 0.40237E+00 0.40045E-02 -0.22014E+00 -0.18003E-03 -0.105E-03 1 + 38 6 76259.97 0.40237E+00 0.40045E-02 -0.22014E+00 -0.18003E-03 -0.105E-03 1 + 38 6 76266.10 0.42690E+00 0.39335E-02 -0.22124E+00 -0.18003E-03 -0.105E-03 1 + 38 6 76266.10 0.42690E+00 0.39335E-02 -0.22124E+00 -0.18003E-03 -0.105E-03 1 + 38 6 76275.63 0.46440E+00 0.38626E-02 -0.22296E+00 -0.18003E-03 -0.105E-03 1 + 38 6 76275.63 0.46440E+00 0.38626E-02 -0.22296E+00 -0.18003E-03 -0.105E-03 1 + 38 6 76281.76 0.48807E+00 0.37917E-02 -0.22406E+00 -0.18003E-03 -0.105E-03 1 + 38 6 76281.76 0.48807E+00 0.37917E-02 -0.22406E+00 -0.18003E-03 -0.105E-03 1 + 38 6 76291.29 0.52422E+00 0.37208E-02 -0.22578E+00 -0.18003E-03 -0.105E-03 1 + 38 6 76291.29 0.52422E+00 0.37208E-02 -0.22578E+00 -0.18003E-03 -0.105E-03 1 + 38 6 76297.42 0.54701E+00 0.36499E-02 -0.22688E+00 -0.18003E-03 -0.105E-03 1 + 38 6 76297.42 0.54701E+00 0.36499E-02 -0.22688E+00 -0.18003E-03 -0.105E-03 1 + 38 6 76306.95 0.58181E+00 0.35789E-02 -0.22860E+00 -0.18003E-03 -0.105E-03 1 + 38 6 76306.95 0.58181E+00 0.35789E-02 -0.22860E+00 -0.18003E-03 -0.105E-03 1 + 38 6 76313.08 0.60374E+00 0.35080E-02 -0.22970E+00 -0.18003E-03 -0.105E-03 1 + 38 6 76313.08 0.60374E+00 0.35080E-02 -0.22970E+00 -0.18003E-03 -0.105E-03 1 + 38 6 76322.61 0.63718E+00 0.34371E-02 -0.23142E+00 -0.18003E-03 -0.105E-03 1 + 38 6 76322.61 0.63718E+00 0.34371E-02 -0.23142E+00 -0.18003E-03 -0.105E-03 1 + 38 6 76329.67 0.66143E+00 -0.10807E-02 -0.23269E+00 -0.17694E-02 -0.105E-03 1 + 38 6 76329.67 0.66143E+00 -0.10807E-02 -0.23269E+00 -0.17694E-02 -0.105E-03 1 + 38 6 76333.67 0.65711E+00 -0.55690E-02 -0.23976E+00 -0.34071E-02 -0.105E-03 1 + 38 6 76333.67 0.65711E+00 -0.55690E-02 -0.23976E+00 -0.34071E-02 -0.105E-03 1 + 38 6 76335.37 0.64764E+00 -0.55713E-02 -0.24556E+00 -0.34091E-02 -0.105E-03 1 + 38 6 76335.37 0.64764E+00 -0.55713E-02 -0.24556E+00 -0.34091E-02 -0.105E-03 1 + 38 6 76336.17 0.64318E+00 -0.55736E-02 -0.24828E+00 -0.34111E-02 -0.105E-03 1 + 38 6 76336.17 0.64318E+00 -0.55736E-02 -0.24828E+00 -0.34111E-02 -0.105E-03 1 + 38 6 76340.72 0.61779E+00 -0.56445E-02 -0.26382E+00 -0.34111E-02 -0.105E-03 1 + 38 6 76340.72 0.61779E+00 -0.56445E-02 -0.26382E+00 -0.34111E-02 -0.105E-03 1 + 38 6 76350.26 0.56398E+00 -0.57154E-02 -0.29634E+00 -0.34111E-02 -0.105E-03 1 + 38 6 76350.26 0.56398E+00 -0.57154E-02 -0.29634E+00 -0.34111E-02 -0.105E-03 1 + 38 6 76356.38 0.52896E+00 -0.57863E-02 -0.31724E+00 -0.34111E-02 -0.105E-03 1 + 38 6 76356.38 0.52896E+00 -0.57863E-02 -0.31724E+00 -0.34111E-02 -0.105E-03 1 + 38 6 76365.92 0.47380E+00 -0.58572E-02 -0.34976E+00 -0.34111E-02 -0.105E-03 1 + 38 6 76365.92 0.47380E+00 -0.58572E-02 -0.34976E+00 -0.34111E-02 -0.105E-03 1 + 38 6 76372.04 0.43791E+00 -0.59282E-02 -0.37066E+00 -0.34111E-02 -0.105E-03 1 + 38 6 76372.04 0.43791E+00 -0.59282E-02 -0.37066E+00 -0.34111E-02 -0.105E-03 1 + 38 6 76381.58 0.38140E+00 -0.59991E-02 -0.40318E+00 -0.34111E-02 -0.105E-03 1 + 38 6 76381.58 0.38140E+00 -0.59991E-02 -0.40318E+00 -0.34111E-02 -0.105E-03 1 + 38 6 76387.70 0.34464E+00 -0.60700E-02 -0.42408E+00 -0.34111E-02 -0.105E-03 1 + 38 6 76387.70 0.34464E+00 -0.60700E-02 -0.42408E+00 -0.34111E-02 -0.105E-03 1 + 38 6 76397.24 0.28678E+00 -0.61409E-02 -0.45660E+00 -0.34111E-02 -0.105E-03 1 + 38 6 76397.24 0.28678E+00 -0.61409E-02 -0.45660E+00 -0.34111E-02 -0.105E-03 1 + 38 6 76403.36 0.24915E+00 -0.62118E-02 -0.47750E+00 -0.34111E-02 -0.105E-03 1 + 38 6 76403.36 0.24915E+00 -0.62118E-02 -0.47750E+00 -0.34111E-02 -0.105E-03 1 + 38 6 76412.90 0.18993E+00 -0.62827E-02 -0.51002E+00 -0.34111E-02 -0.105E-03 1 + 38 6 76412.90 0.18993E+00 -0.62827E-02 -0.51002E+00 -0.34111E-02 -0.105E-03 1 + 38 6 76419.02 0.15144E+00 -0.63536E-02 -0.53092E+00 -0.34111E-02 -0.105E-03 1 + 38 6 76419.02 0.15144E+00 -0.63536E-02 -0.53092E+00 -0.34111E-02 -0.105E-03 1 + 38 6 76428.56 0.90869E-01 -0.64245E-02 -0.56344E+00 -0.34111E-02 -0.105E-03 1 + 38 6 76428.56 0.90869E-01 -0.64245E-02 -0.56344E+00 -0.34111E-02 -0.105E-03 1 + 38 6 76435.61 0.45541E-01 -0.61148E-02 -0.58751E+00 0.58418E-03 -0.105E-03 1 + 38 6 76435.61 0.45541E-01 -0.61148E-02 -0.58751E+00 0.58418E-03 -0.105E-03 1 + 38 6 76439.61 0.21082E-01 -0.59714E-02 -0.58517E+00 0.45636E-02 -0.105E-03 1 + 38 6 76439.61 0.21082E-01 -0.59714E-02 -0.58517E+00 0.45636E-02 -0.105E-03 1 + 38 6 76441.31 0.10931E-01 -0.59757E-02 -0.57741E+00 0.45638E-02 -0.105E-03 1 + 38 6 76441.31 0.10931E-01 -0.59757E-02 -0.57741E+00 0.45638E-02 -0.105E-03 1 + 38 6 76442.11 0.61504E-02 -0.59799E-02 -0.57376E+00 0.45639E-02 -0.105E-03 1 + 38 6 76442.11 0.61504E-02 -0.59799E-02 -0.57376E+00 0.45639E-02 -0.105E-03 1 + 38 6 76446.67 -0.21091E-01 -0.60508E-02 -0.55297E+00 0.45639E-02 -0.105E-03 1 + 38 6 76446.67 -0.21091E-01 -0.60508E-02 -0.55297E+00 0.45639E-02 -0.105E-03 1 + 38 6 76456.20 -0.78776E-01 -0.61217E-02 -0.50946E+00 0.45639E-02 -0.105E-03 1 + 38 6 76456.20 -0.78776E-01 -0.61217E-02 -0.50946E+00 0.45639E-02 -0.105E-03 1 + 38 6 76462.33 -0.11628E+00 -0.61926E-02 -0.48150E+00 0.45639E-02 -0.105E-03 1 + 38 6 76462.33 -0.11628E+00 -0.61926E-02 -0.48150E+00 0.45639E-02 -0.105E-03 1 + 38 6 76471.86 -0.17532E+00 -0.62635E-02 -0.43799E+00 0.45639E-02 -0.105E-03 1 + 38 6 76471.86 -0.17532E+00 -0.62635E-02 -0.43799E+00 0.45639E-02 -0.105E-03 1 + 38 6 76477.99 -0.21369E+00 -0.63343E-02 -0.41003E+00 0.45639E-02 -0.105E-03 1 + 38 6 76477.99 -0.21369E+00 -0.63343E-02 -0.41003E+00 0.45639E-02 -0.105E-03 1 + 38 6 76487.52 -0.27408E+00 -0.64052E-02 -0.36652E+00 0.45639E-02 -0.105E-03 1 + 38 6 76487.52 -0.27408E+00 -0.64052E-02 -0.36652E+00 0.45639E-02 -0.105E-03 1 + 38 6 76493.65 -0.31333E+00 -0.64761E-02 -0.33856E+00 0.45639E-02 -0.105E-03 1 + 38 6 76493.65 -0.31333E+00 -0.64761E-02 -0.33856E+00 0.45639E-02 -0.105E-03 1 + 38 6 76503.18 -0.37506E+00 -0.65470E-02 -0.29505E+00 0.45639E-02 -0.105E-03 1 + 38 6 76503.18 -0.37506E+00 -0.65470E-02 -0.29505E+00 0.45639E-02 -0.105E-03 1 + 38 6 76509.31 -0.41518E+00 -0.66178E-02 -0.26709E+00 0.45639E-02 -0.105E-03 1 + 38 6 76509.31 -0.41518E+00 -0.66178E-02 -0.26709E+00 0.45639E-02 -0.105E-03 1 + 38 6 76518.84 -0.47827E+00 -0.66887E-02 -0.22358E+00 0.45639E-02 -0.105E-03 1 + 38 6 76518.84 -0.47827E+00 -0.66887E-02 -0.22358E+00 0.45639E-02 -0.105E-03 1 + 38 6 76524.97 -0.51925E+00 -0.67595E-02 -0.19561E+00 0.45639E-02 -0.105E-03 1 + 38 6 76524.97 -0.51925E+00 -0.67595E-02 -0.19561E+00 0.45639E-02 -0.105E-03 1 + 38 6 76534.50 -0.58369E+00 -0.68304E-02 -0.15211E+00 0.45639E-02 -0.105E-03 1 + 38 6 76534.50 -0.58369E+00 -0.68304E-02 -0.15211E+00 0.45639E-02 -0.105E-03 1 + 38 6 76541.56 -0.63188E+00 -0.25144E-02 -0.11990E+00 0.37449E-02 -0.105E-03 1 + 38 6 76541.56 -0.63188E+00 -0.25144E-02 -0.11990E+00 0.37449E-02 -0.105E-03 1 + 38 6 76545.56 -0.64194E+00 0.18703E-02 -0.10493E+00 0.30282E-02 -0.105E-03 1 + 38 6 76545.56 -0.64194E+00 0.18703E-02 -0.10493E+00 0.30282E-02 -0.105E-03 1 + 38 6 76547.26 -0.63876E+00 0.18677E-02 -0.99777E-01 0.30290E-02 -0.105E-03 1 + 38 6 76547.26 -0.63876E+00 0.18677E-02 -0.99777E-01 0.30290E-02 -0.105E-03 1 + 38 6 76548.06 -0.63726E+00 0.18652E-02 -0.97354E-01 0.30298E-02 -0.105E-03 1 + 38 6 76548.06 -0.63726E+00 0.18652E-02 -0.97354E-01 0.30298E-02 -0.105E-03 1 + 38 6 76552.61 -0.62877E+00 0.17943E-02 -0.83552E-01 0.30298E-02 -0.105E-03 1 + 38 6 76552.61 -0.62877E+00 0.17943E-02 -0.83552E-01 0.30298E-02 -0.105E-03 1 + 38 6 76562.15 -0.61166E+00 0.17235E-02 -0.54668E-01 0.30298E-02 -0.105E-03 1 + 38 6 76562.15 -0.61166E+00 0.17235E-02 -0.54668E-01 0.30298E-02 -0.105E-03 1 + 38 6 76568.27 -0.60110E+00 0.16526E-02 -0.36105E-01 0.30298E-02 -0.105E-03 1 + 38 6 76568.27 -0.60110E+00 0.16526E-02 -0.36105E-01 0.30298E-02 -0.105E-03 1 + 38 6 76577.81 -0.58535E+00 0.15818E-02 -0.72207E-02 0.30298E-02 -0.105E-03 1 + 38 6 76577.81 -0.58535E+00 0.15818E-02 -0.72207E-02 0.30298E-02 -0.105E-03 1 + 38 6 76583.93 -0.57565E+00 0.15109E-02 0.11342E-01 0.30298E-02 -0.105E-03 1 + 38 6 76583.93 -0.57565E+00 0.15109E-02 0.11342E-01 0.30298E-02 -0.105E-03 1 + 38 6 76593.47 -0.56125E+00 0.14401E-02 0.40227E-01 0.30298E-02 -0.105E-03 1 + 38 6 76593.47 -0.56125E+00 0.14401E-02 0.40227E-01 0.30298E-02 -0.105E-03 1 + 38 6 76599.59 -0.55243E+00 0.13692E-02 0.58790E-01 0.30298E-02 -0.105E-03 1 + 38 6 76599.59 -0.55243E+00 0.13692E-02 0.58790E-01 0.30298E-02 -0.105E-03 1 + 38 6 76609.13 -0.53937E+00 0.12984E-02 0.87674E-01 0.30298E-02 -0.105E-03 1 + 38 6 76609.13 -0.53937E+00 0.12984E-02 0.87674E-01 0.30298E-02 -0.105E-03 1 + 38 6 76615.25 -0.53142E+00 0.12275E-02 0.10624E+00 0.30298E-02 -0.105E-03 1 + 38 6 76615.25 -0.53142E+00 0.12275E-02 0.10624E+00 0.30298E-02 -0.105E-03 1 + 38 6 76624.79 -0.51972E+00 0.11567E-02 0.13512E+00 0.30298E-02 -0.105E-03 1 + 38 6 76624.79 -0.51972E+00 0.11567E-02 0.13512E+00 0.30298E-02 -0.105E-03 1 + 38 6 76630.91 -0.51263E+00 0.10858E-02 0.15368E+00 0.30298E-02 -0.105E-03 1 + 38 6 76630.91 -0.51263E+00 0.10858E-02 0.15368E+00 0.30298E-02 -0.105E-03 1 + 38 6 76640.45 -0.50228E+00 0.10149E-02 0.18257E+00 0.30298E-02 -0.105E-03 1 + 38 6 76640.45 -0.50228E+00 0.10149E-02 0.18257E+00 0.30298E-02 -0.105E-03 1 + 38 6 76647.50 -0.49512E+00 -0.23521E-02 0.20394E+00 0.16429E-02 -0.105E-03 1 + 38 6 76647.50 -0.49512E+00 -0.23521E-02 0.20394E+00 0.16429E-02 -0.105E-03 1 + 38 6 76651.50 -0.50453E+00 -0.57831E-02 0.21052E+00 0.21126E-03 -0.105E-03 1 + 38 6 76651.50 -0.50453E+00 -0.57831E-02 0.21052E+00 0.21126E-03 -0.105E-03 1 + 38 6 76653.20 -0.51436E+00 -0.57803E-02 0.21088E+00 0.21406E-03 -0.105E-03 1 + 38 6 76653.20 -0.51436E+00 -0.57803E-02 0.21088E+00 0.21406E-03 -0.105E-03 1 + 38 6 76654.00 -0.51898E+00 -0.57774E-02 0.21105E+00 0.21689E-03 -0.105E-03 1 + 38 6 76654.00 -0.51898E+00 -0.57774E-02 0.21105E+00 0.21689E-03 -0.105E-03 1 + 38 6 76658.56 -0.54530E+00 -0.58482E-02 0.21203E+00 0.21689E-03 -0.105E-03 1 + 38 6 76658.56 -0.54530E+00 -0.58482E-02 0.21203E+00 0.21689E-03 -0.105E-03 1 + 38 6 76668.09 -0.60105E+00 -0.59191E-02 0.21410E+00 0.21689E-03 -0.105E-03 1 + 38 6 76668.09 -0.60105E+00 -0.59191E-02 0.21410E+00 0.21689E-03 -0.105E-03 1 + 38 6 76674.22 -0.63732E+00 -0.59899E-02 0.21543E+00 0.21689E-03 -0.105E-03 1 + 38 6 76674.22 -0.63732E+00 -0.59899E-02 0.21543E+00 0.21689E-03 -0.105E-03 1 + 38 6 76683.75 -0.69442E+00 -0.60608E-02 0.21750E+00 0.21689E-03 -0.105E-03 1 + 38 6 76683.75 -0.69442E+00 -0.60608E-02 0.21750E+00 0.21689E-03 -0.105E-03 1 + 38 6 76689.88 -0.73156E+00 -0.61316E-02 0.21883E+00 0.21689E-03 -0.105E-03 1 + 38 6 76689.88 -0.73156E+00 -0.61316E-02 0.21883E+00 0.21689E-03 -0.105E-03 1 + 38 6 76699.41 -0.79001E+00 -0.62024E-02 0.22090E+00 0.21689E-03 -0.105E-03 1 + 38 6 76699.41 -0.79001E+00 -0.62024E-02 0.22090E+00 0.21689E-03 -0.105E-03 1 + 38 6 76705.54 -0.82801E+00 -0.62733E-02 0.22222E+00 0.21689E-03 -0.105E-03 1 + 38 6 76705.54 -0.82801E+00 -0.62733E-02 0.22222E+00 0.21689E-03 -0.105E-03 1 + 38 6 76715.07 -0.88782E+00 -0.63441E-02 0.22429E+00 0.21689E-03 -0.105E-03 1 + 38 6 76715.07 -0.88782E+00 -0.63441E-02 0.22429E+00 0.21689E-03 -0.105E-03 1 + 38 6 76721.20 -0.92669E+00 -0.64149E-02 0.22562E+00 0.21689E-03 -0.105E-03 1 + 38 6 76721.20 -0.92669E+00 -0.64149E-02 0.22562E+00 0.21689E-03 -0.105E-03 1 + 38 6 76730.73 -0.98784E+00 -0.64858E-02 0.22769E+00 0.21689E-03 -0.105E-03 1 + 38 6 76730.73 -0.98784E+00 -0.64858E-02 0.22769E+00 0.21689E-03 -0.105E-03 1 + 38 6 76736.86 -0.10276E+01 -0.65566E-02 0.22902E+00 0.21689E-03 -0.105E-03 1 + 38 6 76736.86 -0.10276E+01 -0.65566E-02 0.22902E+00 0.21689E-03 -0.105E-03 1 + 38 6 76746.39 -0.10901E+01 -0.66274E-02 0.23108E+00 0.21689E-03 -0.105E-03 1 + 38 6 76746.39 -0.10901E+01 -0.66274E-02 0.23108E+00 0.21689E-03 -0.105E-03 1 + 38 6 76753.45 -0.11368E+01 0.11377E-02 0.23262E+00 0.18057E-02 -0.105E-03 1 + 38 6 76753.45 -0.11368E+01 0.11377E-02 0.23262E+00 0.18057E-02 -0.105E-03 1 + 38 6 76757.45 -0.11323E+01 0.88717E-02 0.23984E+00 0.34439E-02 -0.105E-03 1 + 38 6 76757.45 -0.11323E+01 0.88717E-02 0.23984E+00 0.34439E-02 -0.105E-03 1 + 38 6 76759.15 -0.11172E+01 0.88641E-02 0.24569E+00 0.34404E-02 -0.105E-03 1 + 38 6 76759.15 -0.11172E+01 0.88641E-02 0.24569E+00 0.34404E-02 -0.105E-03 1 + 38 6 76759.95 -0.11101E+01 0.88566E-02 0.24844E+00 0.34369E-02 -0.105E-03 1 + 38 6 76759.95 -0.11101E+01 0.88566E-02 0.24844E+00 0.34369E-02 -0.105E-03 1 + 38 6 76764.50 -0.10698E+01 0.87858E-02 0.26410E+00 0.34369E-02 -0.105E-03 1 + 38 6 76764.50 -0.10698E+01 0.87858E-02 0.26410E+00 0.34369E-02 -0.105E-03 1 + 38 6 76774.04 -0.98602E+00 0.87149E-02 0.29687E+00 0.34369E-02 -0.105E-03 1 + 38 6 76774.04 -0.98602E+00 0.87149E-02 0.29687E+00 0.34369E-02 -0.105E-03 1 + 38 6 76780.16 -0.93262E+00 0.86441E-02 0.31792E+00 0.34369E-02 -0.105E-03 1 + 38 6 76780.16 -0.93262E+00 0.86441E-02 0.31792E+00 0.34369E-02 -0.105E-03 1 + 38 6 76789.70 -0.85022E+00 0.85733E-02 0.35069E+00 0.34369E-02 -0.105E-03 1 + 38 6 76789.70 -0.85022E+00 0.85733E-02 0.35069E+00 0.34369E-02 -0.105E-03 1 + 38 6 76795.82 -0.79769E+00 0.85024E-02 0.37175E+00 0.34369E-02 -0.105E-03 1 + 38 6 76795.82 -0.79769E+00 0.85024E-02 0.37175E+00 0.34369E-02 -0.105E-03 1 + 38 6 76805.36 -0.71663E+00 0.84316E-02 0.40451E+00 0.34369E-02 -0.105E-03 1 + 38 6 76805.36 -0.71663E+00 0.84316E-02 0.40451E+00 0.34369E-02 -0.105E-03 1 + 38 6 76811.48 -0.66497E+00 0.83607E-02 0.42557E+00 0.34369E-02 -0.105E-03 1 + 38 6 76811.48 -0.66497E+00 0.83607E-02 0.42557E+00 0.34369E-02 -0.105E-03 1 + 38 6 76821.02 -0.58527E+00 0.82899E-02 0.45833E+00 0.34369E-02 -0.105E-03 1 + 38 6 76821.02 -0.58527E+00 0.82899E-02 0.45833E+00 0.34369E-02 -0.105E-03 1 + 38 6 76827.14 -0.53448E+00 0.82190E-02 0.47939E+00 0.34369E-02 -0.105E-03 1 + 38 6 76827.14 -0.53448E+00 0.82190E-02 0.47939E+00 0.34369E-02 -0.105E-03 1 + 38 6 76836.68 -0.45612E+00 0.81482E-02 0.51215E+00 0.34369E-02 -0.105E-03 1 + 38 6 76836.68 -0.45612E+00 0.81482E-02 0.51215E+00 0.34369E-02 -0.105E-03 1 + 38 6 76842.80 -0.40620E+00 0.80773E-02 0.53321E+00 0.34369E-02 -0.105E-03 1 + 38 6 76842.80 -0.40620E+00 0.80773E-02 0.53321E+00 0.34369E-02 -0.105E-03 1 + 38 6 76852.34 -0.32920E+00 0.80064E-02 0.56598E+00 0.34369E-02 -0.105E-03 1 + 38 6 76852.34 -0.32920E+00 0.80064E-02 0.56598E+00 0.34369E-02 -0.105E-03 1 + 38 6 76859.39 -0.27271E+00 0.61519E-02 0.59023E+00 -0.57695E-03 -0.105E-03 1 + 38 6 76859.39 -0.27271E+00 0.61519E-02 0.59023E+00 -0.57695E-03 -0.105E-03 1 + 38 6 76863.39 -0.24810E+00 0.44647E-02 0.58792E+00 -0.45751E-02 -0.105E-03 1 + 38 6 76863.39 -0.24810E+00 0.44647E-02 0.58792E+00 -0.45751E-02 -0.105E-03 1 + 38 6 76865.09 -0.24051E+00 0.44611E-02 0.58014E+00 -0.45715E-02 -0.105E-03 1 + 38 6 76865.09 -0.24051E+00 0.44611E-02 0.58014E+00 -0.45715E-02 -0.105E-03 1 + 38 6 76865.89 -0.23694E+00 0.44576E-02 0.57648E+00 -0.45679E-02 -0.105E-03 1 + 38 6 76865.89 -0.23694E+00 0.44576E-02 0.57648E+00 -0.45679E-02 -0.105E-03 1 + 38 6 76870.45 -0.21663E+00 0.43867E-02 0.55567E+00 -0.45679E-02 -0.105E-03 1 + 38 6 76870.45 -0.21663E+00 0.43867E-02 0.55567E+00 -0.45679E-02 -0.105E-03 1 + 38 6 76879.98 -0.17481E+00 0.43158E-02 0.51213E+00 -0.45679E-02 -0.105E-03 1 + 38 6 76879.98 -0.17481E+00 0.43158E-02 0.51213E+00 -0.45679E-02 -0.105E-03 1 + 38 6 76886.11 -0.14837E+00 0.42449E-02 0.48414E+00 -0.45679E-02 -0.105E-03 1