source: palm/tags/release-3.6/SOURCE/user_check_data_output.f90 @ 2977

Last change on this file since 2977 was 226, checked in by raasch, 15 years ago

preparations for the next release

  • Property svn:keywords set to Id
File size: 1.1 KB
Line 
1 SUBROUTINE user_check_data_output( variable, unit )
2
3!------------------------------------------------------------------------------!
4! Actual revisions:
5! -----------------
6!
7!
8! Former revisions:
9! -----------------
10! $Id: user_check_data_output.f90 226 2009-02-02 07:39:34Z kanani $
11!
12! 211 2008-11-11 04:46:24Z raasch
13! Former file user_interface.f90 split into one file per subroutine
14!
15! Description:
16! ------------
17! Set the unit of user defined output quantities. For those variables
18! not recognized by the user, the parameter unit is set to "illegal", which
19! tells the calling routine that the output variable is not defined and leads
20! to a program abort.
21!------------------------------------------------------------------------------!
22
23    USE user
24
25    IMPLICIT NONE
26
27    CHARACTER (LEN=*) ::  unit, variable
28
29
30    SELECT CASE ( TRIM( variable ) )
31
32!
33!--    Uncomment and extend the following lines, if necessary
34!       CASE ( 'u2' )
35!          unit = 'm2/s2'
36!
37!       CASE ( 'u*v*' )
38!          unit = 'm2/s2'
39!
40       CASE DEFAULT
41          unit = 'illegal'
42
43    END SELECT
44
45
46 END SUBROUTINE user_check_data_output
47
Note: See TracBrowser for help on using the repository browser.