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

Last change on this file since 1036 was 1036, checked in by raasch, 12 years ago

code has been put under the GNU General Public License (v3)

  • Property svn:keywords set to Id
File size: 1.8 KB
Line 
1 SUBROUTINE user_check_data_output( variable, unit )
2
3!--------------------------------------------------------------------------------!
4! This file is part of PALM.
5!
6! PALM is free software: you can redistribute it and/or modify it under the terms
7! of the GNU General Public License as published by the Free Software Foundation,
8! either version 3 of the License, or (at your option) any later version.
9!
10! PALM is distributed in the hope that it will be useful, but WITHOUT ANY
11! WARRANTY; without even the implied warranty of MERCHANTABILITY or FITNESS FOR
12! A PARTICULAR PURPOSE.  See the GNU General Public License for more details.
13!
14! You should have received a copy of the GNU General Public License along with
15! PALM. If not, see <http://www.gnu.org/licenses/>.
16!
17! Copyright 1997-2012  Leibniz University Hannover
18!--------------------------------------------------------------------------------!
19!
20! Current revisions:
21! -----------------
22!
23!
24! Former revisions:
25! -----------------
26! $Id: user_check_data_output.f90 1036 2012-10-22 13:43:42Z raasch $
27!
28! 211 2008-11-11 04:46:24Z raasch
29! Former file user_interface.f90 split into one file per subroutine
30!
31! Description:
32! ------------
33! Set the unit of user defined output quantities. For those variables
34! not recognized by the user, the parameter unit is set to "illegal", which
35! tells the calling routine that the output variable is not defined and leads
36! to a program abort.
37!------------------------------------------------------------------------------!
38
39    USE user
40
41    IMPLICIT NONE
42
43    CHARACTER (LEN=*) ::  unit, variable
44
45
46    SELECT CASE ( TRIM( variable ) )
47
48!
49!--    Uncomment and extend the following lines, if necessary
50!       CASE ( 'u2' )
51!          unit = 'm2/s2'
52!
53!       CASE ( 'u*v*' )
54!          unit = 'm2/s2'
55!
56       CASE DEFAULT
57          unit = 'illegal'
58
59    END SELECT
60
61
62 END SUBROUTINE user_check_data_output
63
Note: See TracBrowser for help on using the repository browser.