/[lmdze]/trunk/libf/IOIPSL/ioget_calendar.f90
ViewVC logotype

Contents of /trunk/libf/IOIPSL/ioget_calendar.f90

Parent Directory Parent Directory | Revision Log Revision Log


Revision 62 - (show annotations)
Thu Jul 26 14:37:37 2012 UTC (11 years, 10 months ago) by guez
File size: 3105 byte(s)
Changed handling of compiler in compilation system.

Removed the prefix letters "y", "p", "t" or "z" in some names of variables.

Replaced calls to NetCDF by calls to NetCDF95.

Extracted "ioget_calendar" procedures from "calendar.f90" into a
separate file.

Extracted to a separate file, "mathop2.f90", procedures that were not
part of the generic interface "mathop" in "mathop.f90".

Removed computation of "dq" in "bilan_dyn", which was not used.

In "iniadvtrac", removed schemes 20 Slopes and 30 Prather. Was not
compatible with declarations of array sizes.

In "clcdrag", "ustarhb", "vdif_kcay", "yamada4" and "coefkz", changed
the size of some arrays from "klon" to "knon".

Removed possible call to "conema3" in "physiq".

Removed unused argument "cd" in "yamada".

1 MODULE ioget_calendar_m
2
3 use calendar, only: lock_unan
4
5 IMPLICIT NONE
6
7 PRIVATE
8 PUBLIC ioget_calendar
9
10 INTERFACE ioget_calendar
11 MODULE PROCEDURE ioget_calendar_real1, ioget_calendar_real2, &
12 ioget_calendar_str
13 END INTERFACE
14
15 CONTAINS
16
17 SUBROUTINE ioget_calendar_str (str)
18 !---------------------------------------------------------------------
19 !- This subroutine returns the name of the calendar used here.
20 !- Three options exist :
21 !- - gregorian : This is the gregorian calendar (default here)
22 !- - noleap : A calendar without leap years = 365 days
23 !- - xxxd : A calendar of xxx days (has to be a modulo of 12)
24 !- with 12 month of equal length
25
26 !- This routine will lock the calendar.
27 !- You do not want it to change after your inquiry.
28 !---------------------------------------------------------------------
29 use calendar, only: calendar_used
30
31 CHARACTER(LEN=*),INTENT(OUT) :: str
32 !---------------------------------------------------------------------
33 lock_unan = .TRUE.
34
35 str = calendar_used
36 !--------------------------------
37 END SUBROUTINE ioget_calendar_str
38 !-
39 !===
40 !-
41 SUBROUTINE ioget_calendar_real1 (long_an)
42 !---------------------------------------------------------------------
43 !- This subroutine returns the name of the calendar used here.
44 !- Three options exist :
45 !- - gregorian : This is the gregorian calendar (default here)
46 !- - noleap : A calendar without leap years = 365 days
47 !- - xxxd : A calendar of xxx days (has to be a modulo of 12)
48 !- with 12 month of equal length
49
50 !- This routine will lock the calendar.
51 !- You do not want it to change after your inquiry.
52 !---------------------------------------------------------------------
53 use calendar, only: un_an
54
55 REAL,INTENT(OUT) :: long_an
56 !---------------------------------------------------------------------
57 lock_unan = .TRUE.
58
59 long_an = un_an
60 !----------------------------------
61 END SUBROUTINE ioget_calendar_real1
62 !-
63 !===
64 !-
65 SUBROUTINE ioget_calendar_real2 (long_an,long_jour)
66 !---------------------------------------------------------------------
67 !- This subroutine returns the name of the calendar used here.
68 !- Three options exist :
69 !- - gregorian : This is the gregorian calendar (default here)
70 !- - noleap : A calendar without leap years = 365 days
71 !- - xxxd : A calendar of xxx days (has to be a modulo of 12)
72 !- with 12 month of equal length
73
74 !- This routine will lock the calendar.
75 !- You do not want it to change after your inquiry.
76 !---------------------------------------------------------------------
77 use calendar, only: un_an, un_jour
78
79 REAL,INTENT(OUT) :: long_an,long_jour
80 !---------------------------------------------------------------------
81 lock_unan = .TRUE.
82
83 long_an = un_an
84 long_jour = un_jour
85 !----------------------------------
86 END SUBROUTINE ioget_calendar_real2
87
88 END MODULE ioget_calendar_m

  ViewVC Help
Powered by ViewVC 1.1.21