Module beam_spot_mod

module beam_spot_mod

        ! Uses
    use namelist_mod
    use precision_mod
    use det_geom_mod, ONLY: nDPlanes, nPPlanes, zdplane, zpplane, tmuscint
    use pattern_mod
    use hists_mod

        ! Subroutines and functions
    public subroutine BeamSpots ()
    private subroutine DecaySpots ()
    private subroutine beamPositronSpots ()
    private subroutine muonScintSpot ()
    private function finite (x)
    private function makeFinite (x, y)

end module beam_spot_mod
 MODIULE beam_spot_mod

==============================================================================
 Author: Blair Jamieson
 Initial Revision Mar. 31, 2002
 Last Updated: June 28, 2002
------------------------------------------------------------------------------

 This module contains subroutines for creating beam spot histograms using
 helix fit results.

 The main steering subroutine is BeamSpots, which can be enabled or disabled
 with the namelist variable: name hist enableBeamSpots.  The type of beam spot
 histograms produced depends on which types of helix fits have been anabled.
 You will get beamspot histograms of everything if you set the namelist variable
 name helixfit helixfitall to be true.  See helixfit namelists for enabling 
 individual particle type helix fits.

==============================================================================

Description of Subroutines and Functions

BeamSpots

public subroutine BeamSpots ()
    ! Calls: BeamPositronSpots, DecaySpots, MuonScintSpot
end subroutine BeamSpots
 SUBROUTINE BeamSpots
----------------------------------------------------------------------------
 This is the main steering subroutine for creating beam spot histograms
 from helix fits.

DecaySpots

private subroutine DecaySpots ()
    ! Calls: HF1, HF2, hf1, uv2xy
end subroutine DecaySpots
 SUBROUTINE DecaySpots
-----------------------------------------------------------------------------
 This subroutine tries to create beamspots of the decay positrons at the target
 and at PC1.  Also some attempt is made to make muon decay beamspots.

beamPositronSpots

private subroutine beamPositronSpots ()
    ! Calls: hf1, hf2, hff1, hff2, uv2xy
end subroutine beamPositronSpots
 SUBROUTINE beamPositronSpots
----------------------------------------------------------------------------
 This subroutine makes beamspot histograms of beam positrons just after coming
 into the detector after the muon scintillator.  This routine also makes 
 histograms of the beam positron total and transverse momentum.  If the namelist
 name global unpackmc = T, then a duplicate set of these histograms is made using
 the MC spacepoints bank.

muonScintSpot

private subroutine muonScintSpot ()
    ! Calls: ConvertFGZtoVPQ, hf1, hf2, hff1, hff2, uv2xy
end subroutine muonScintSpot
 SUBROUTINE muonScintSpot
----------------------------------------------------------------------------
 This subroutine attempts to make beamspot histograms of muons just after coming
 into the detector after the muon scintillator.  This routine also makes 
 histograms of the muon total and transverse momentum.  If the namelist
 name global unpackmc = T, then a duplicate set of these histograms is made using
 the MC spacepoints bank.  Use first guess fit for estimates.

finite

private function finite (x)
    real (kind=R8), INTENT(in) :: x
    logical :: finite
end function finite

makeFinite

private function makeFinite (x, y)
    real (kind=R8), INTENT(in) :: x
    real (kind=R8), INTENT(in) :: y
    real (kind=R8) :: makeFinite
end function makeFinite