source: palm/trunk/SOURCE/user_module.f90 @ 704

Last change on this file since 704 was 484, checked in by raasch, 14 years ago

typo in file headers removed

  • Property svn:keywords set to Id
File size: 1.5 KB
Line 
1 MODULE user
2
3!------------------------------------------------------------------------------!
4! Current revisions:
5! -----------------
6!
7!
8! Former revisions:
9! -----------------
10! $Id: user_module.f90 484 2010-02-05 07:36:54Z suehring $
11!
12! 220 2008-12-18 07:00:36Z raasch
13! Former file user_interface.f90 split into one file per subroutine,
14! revision history cleaned up
15!
16! 159 2008-04-09 08:06:03Z raasch
17! bugfix in user_read_restart_data
18! small bugfixes for sample code (comments):
19! - initialize ustvst with 0.0 as it is now computed only until nxr and nyn
20! - two ALLOCATE statements moved from user_read_restart_data back to user_init
21! - remove 'READ (13) u2_av' statement in user_read_restart_data
22! +routines user_read_restart_data, user_spectra
23!
24! RCS Log replace by Id keyword, revision history cleaned up
25!
26! Revision 1.18  2006/06/02 15:25:00  raasch
27! +change of grid-defining arguments in routine user_define_netcdf_grid,
28! new argument "found" in user_data_output_2d and user_data_output_3d
29!
30! Revision 1.1  1998/03/24 15:29:04  raasch
31! Initial revision
32!
33!
34! Description:
35! ------------
36! Declaration of user-defined variables. This module may only be used
37! in the user-defined routines (contained in user_interface.f90).
38!------------------------------------------------------------------------------!
39
40    INTEGER ::  dots_num_palm, user_idummy
41    LOGICAL ::  user_defined_namelist_found = .FALSE.
42    REAL    ::  user_rdummy
43
44!
45!-- Sample for user-defined output
46!    REAL, DIMENSION(:,:,:), ALLOCATABLE ::  u2, u2_av
47!    REAL, DIMENSION(:,:,:), ALLOCATABLE ::  ustvst
48
49    SAVE
50
51 END MODULE user
Note: See TracBrowser for help on using the repository browser.