synthetic_camera Subroutine

public subroutine synthetic_camera(params, spp)

Arguments

Type IntentOptional AttributesName
type(KORC_PARAMS), intent(in) :: params
type(SPECIES), intent(in), DIMENSION(:), ALLOCATABLE:: spp

Contents

Source Code


Source Code

  SUBROUTINE synthetic_camera(params,spp)
    IMPLICIT NONE
    TYPE(KORC_PARAMS), INTENT(IN) :: params
    TYPE(SPECIES), DIMENSION(:), ALLOCATABLE, INTENT(IN) :: spp

    if (cam%camera_on.AND.(params%time*params%cpp%time >= cam%start_at)) then
       if (params%mpi_params%rank .EQ. 0) then
          write(6,'("Synthetic camera diagnostic: ON")',advance="no")
       end if

       if (cam%integrated_opt) then
          call integrated_SE_3D(params,spp)
          call integrated_spectral_density(params,spp)
       else
          call angular_density(params,spp)
          call spectral_density(params,spp)
       end if

       if (params%mpi_params%rank .EQ. 0) then
          write(6,'(" ---> OFF")')
       end if
    end if
  END SUBROUTINE synthetic_camera