!
!##################################################################
!##################################################################
!######                                                      ######
!######                SUBROUTINE NETREAD                    ######
!######                                                      ######
!######                     Developed by                     ######
!######     Center for Analysis and Prediction of Storms     ######
!######                University of Oklahoma                ######
!######                                                      ######
!##################################################################
!##################################################################
!


SUBROUTINE netread 4,1
!
!-----------------------------------------------------------------------
!
!  PURPOSE:
!
!  A dummy routine to be called instead of the truly functional routine
!  netread when word packing routines are not available on a given system.
!
!-----------------------------------------------------------------------
!
  WRITE (6,'(5(/a))')                                                   &
      ' We have stopped supporting the NetCDF format',                  &
      ' starting from ARPS version 4.1.5, for the lack of use.',        &
      ' If you wish to use this format, you can obtain the file ',      &
      ' netio3d.f from the pre-4.1.5 versions. Some code update',       &
      ' may be need however.'
  CALL arpsstop('arpsstop called from NETREAD not supported.',1)

END SUBROUTINE netread
!
!##################################################################
!##################################################################
!######                                                      ######
!######                SUBROUTINE NETDUMP                    ######
!######                                                      ######
!######                     Developed by                     ######
!######     Center for Analysis and Prediction of Storms     ######
!######                University of Oklahoma                ######
!######                                                      ######
!##################################################################
!##################################################################
!


SUBROUTINE netdump 2,1
!
!-----------------------------------------------------------------------
!
!  PURPOSE:
!
!    A dummy routine to be called instead of the functional routine
!    netdump when packing is not avaiable.
!
!-----------------------------------------------------------------------
!
  WRITE (6,'(5(/a))')                                                   &
      ' We have stopped supporting the NetCDF format',                  &
      ' starting from ARPS version 4.1.5, for the lack of use.',        &
      ' If you wish to use this format, you can obtain the file ',      &
      ' netio3d.f from the pre-4.1.5 versions. Some code update',       &
      ' may be need however.'
  CALL arpsstop('arpsstop called from NETDUMP not supported.',1)

END SUBROUTINE netdump