!:physflux:! Define convective fluxes
  SUBROUTINE physflux(ixy,indx,irequest,Info,q,f,s,A)
      ! User definitions of data structures associated with each node
      USE NodeInfoDef
      ! Interface declarations
      INTEGER ixy           ! The dimension along which to solve the normal Riemann problem
      INTEGER indx(MaxDims) ! Indices of this slice, indx(ixy) has no significance, other
                            ! indices give position of this 1D slice in index space
      INTEGER irequest      ! Request code, see NodeInfoGlobal.f90 for definitions
                            ! Additional request codes may be defined in solver modules
      TYPE (NodeInfo) :: Info  ! Data associated with this grid
      REAL (KIND=qPrec), POINTER, DIMENSION (:,:) :: q,f,s
      REAL (KIND=qPrec), POINTER, DIMENSION (:,:,:) :: A