source: palm/trunk/SOURCE/user_check_data_output.f90 @ 211

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

user interface was split into one single file per subroutine

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