source: palm/trunk/SOURCE/user_header.f90 @ 243

Last change on this file since 243 was 240, checked in by letzel, 15 years ago
  • External pressure gradient (check_parameters, init_3d_model, header, modules, parin, prognostic_equations)
  • New topography case 'single_street_canyon'
  • Property svn:keywords set to Id
File size: 2.3 KB
Line 
1 SUBROUTINE user_header( io )
2
3!------------------------------------------------------------------------------!
4! Actual revisions:
5! -----------------
6! new topography case 'single_street_canyon'
7!
8! Former revisions:
9! -----------------
10! $Id: user_header.f90 240 2009-02-18 17:50:38Z letzel $
11!
12! 2008-12-09 18:00:48Z letzel
13! +topography_grid_convention
14! Former file user_interface.f90 split into one file per subroutine
15!
16! Description:
17! ------------
18! Print a header with user-defined informations.
19!------------------------------------------------------------------------------!
20
21    USE control_parameters
22    USE statistics
23    USE user
24
25    IMPLICIT NONE
26
27    INTEGER ::  i, io
28
29!
30!-- If no user-defined variables are read from the namelist-file, no
31!-- informations will be printed.
32    IF ( .NOT. user_defined_namelist_found )  THEN
33       WRITE ( io, 100 )
34       RETURN
35    ENDIF
36
37!
38!-- Printing the informations.
39    WRITE ( io, 110 )
40
41    IF ( statistic_regions /= 0 )  THEN
42       WRITE ( io, 200 )
43       DO  i = 0, statistic_regions
44          WRITE ( io, 201 )  i, region(i)
45       ENDDO
46    ENDIF
47
48    IF ( TRIM( topography ) /= 'flat' )  THEN
49       WRITE ( io, 300 )
50       IF ( TRIM( topography_grid_convention ) == ' ' )  THEN
51          IF ( TRIM( topography ) == 'single_building' .OR.  &
52               TRIM( topography ) == 'single_street_canyon' )  THEN
53             WRITE ( io, 301 )
54          ELSEIF ( TRIM( topography ) == 'read_from_file' )  THEN
55             WRITE ( io, 302 )
56          ENDIF
57       ELSEIF ( TRIM( topography_grid_convention ) == 'cell_edge' )  THEN
58          WRITE ( io, 301 )
59       ELSEIF ( TRIM( topography_grid_convention ) == 'cell_center' )  THEN
60          WRITE ( io, 302 )
61       ENDIF
62    ENDIF
63
64!
65!-- Format-descriptors
66100 FORMAT (//' *** no user-defined variables found'/)
67110 FORMAT (//1X,78('#')                                      &
68            //' User-defined variables and actions:'/  &
69              ' -----------------------------------'//)
70200 FORMAT (' Output of profiles and time series for following regions:' /)
71201 FORMAT (4X,'Region ',I1,':   ',A)
72300 FORMAT (' Topography grid definition convention:'/)
73301 FORMAT (' cell edge (staggered grid points'/  &
74            ' (u in x-direction, v in y-direction))' /)
75302 FORMAT (' cell center (scalar grid points)' /)
76
77
78 END SUBROUTINE user_header
79
Note: See TracBrowser for help on using the repository browser.