!
!##################################################################
!##################################################################
!###### ######
!###### DUMMY SUBROUTINES FOR ASSIMILATION ######
!###### ######
!###### Copyright (c) 1993 ######
!###### Center for Analysis and Prediction of Storms ######
!###### University of Oklahoma. All rights reserved. ######
!###### ######
!##################################################################
!##################################################################
!
SUBROUTINE assimcon 1,3
!
!-----------------------------------------------------------------------
!
! Variable Declarations.
!
!-----------------------------------------------------------------------
!
IMPLICIT NONE ! Force explicit declarations
!
!@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@
!
! Beginning of executable code ...
!
!@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@
!
WRITE(6,'(a,a/a/a)') &
'Dummy subroutine ASSIMCON was called. ', &
'Check input parameter assimopt. ', &
'If assimopt=1, the real subroutine should be linked.', &
'Program stopped in dummy ASSIMCON in file assimdummy.f'
CALL arpsstop
('arpsstop called from assimcon',1)
END SUBROUTINE assimcon
SUBROUTINE assimdriv 1,21
!
!-----------------------------------------------------------------------
!
! Variable Declarations.
!
!-----------------------------------------------------------------------
!
IMPLICIT NONE ! Force explicit declarations
!
!@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@
!
! Beginning of executable code ...
!
!@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@
!
WRITE(6,'(a,a/a/a)') &
'Dummy subroutine ASSIMDRIV was called. ', &
'Check input parameter assimopt. ', &
'If assimopt=1, the real subroutine should be linked.', &
'Program stopped in dummy ASSIMDRIV in file assimdummy.f'
CALL arpsstop
('arpsstop called from assimdriv ',1)
END SUBROUTINE assimdriv
SUBROUTINE assimptpr 1,16
WRITE (6,'(a,a,a)') 'You are calling a dummy function. ', &
'The model stopped here in assimdummy.f.'
CALL arpsstop
('arpsstop called from assimdriv',1)
END SUBROUTINE assimptpr