64 USE modd_data_cover_par
, ONLY : nvegtype, jpcover, ncover_eco1_end, ncover_eco2_start
76 INTEGER,
INTENT(IN) :: KFILE
82 INTEGER :: INB_COVER, INB_AN
83 INTEGER :: ICOVER, IREC
89 REAL(KIND=JPRB) :: ZHOOK_HANDLE
91 IF (
lhook)
CALL dr_hook(
'READ_COVERS_PARAM',0,zhook_handle)
95 OPEN(41,file=
'ecoclimapI_covers_param.bin',form=
'UNFORMATTED',access=
'DIRECT' 96 'OLD',iostat=ierr_open)
97 IF (ierr_open /= 0 )
THEN 98 CALL abor1_sfx (
'ERROR WHILE OPENING ''ecoclimapI_covers_param.bin'' THIS FILE IS NEEDED AND MUST BE' 99 ' IN (OR LINKED TO) THE RUN DIRECTORY')
101 inb_cover = ncover_eco1_end
103 ELSEIF (kfile==2)
THEN 104 OPEN(41,file=
'ecoclimapII_eu_covers_param.bin',form=
'UNFORMATTED',access
'DIRECT' 105 'OLD',iostat=ierr_open)
106 IF (ierr_open /= 0 )
THEN 107 CALL abor1_sfx (
'ERROR WHILE OPENING ''ecoclimapII_eu_covers_param.bin'' THIS FILE IS NEEDED AND MUST BE' 108 ' IN (OR LINKED TO) THE RUN DIRECTORY')
110 inb_cover = jpcover - ncover_eco2_start + 1
115 DO jcover = 1,inb_cover
117 READ(41,rec=irec) icover
164 IF (
lhook)
CALL dr_hook(
'READ_COVERS_PARAM',1,zhook_handle)
170 REAL,
DIMENSION(12) :: ZINTER
171 INTEGER :: JVEGTYPE, JLAI
172 REAL(KIND=JPRB) :: ZHOOK_HANDLE
174 IF (
lhook)
CALL dr_hook(
'READ_COVERS_PARAM:READ_NATURE',0,zhook_handle)
183 READ(41,rec=irec) zinter(:)
186 READ(41,rec=irec) zinter(:)
189 READ(41,rec=irec) zinter(:)
192 READ(41,rec=irec) zinter(:)
195 READ(41,rec=irec) zinter(:)
198 READ(41,rec=irec) zinter(:)
202 DO jvegtype=1,nvegtype
208 IF (jvegtype.GT.3)
THEN 213 READ(41,rec=irec) zinter(:)
214 xdata_lai(icover,(jlai-1)*12+1:jlai*12,jvegtype) = zinter(:)
215 ELSEIF (kfile==2)
THEN 216 READ(41,rec=irec) zinter(:)
221 IF ((jvegtype < 7) .OR. (jvegtype > 12 .AND. jvegtype /= 18))
THEN 228 READ(41,rec=irec) zinter(:)
231 READ(41,rec=irec) zinter(:)
234 READ(41,rec=irec) zinter(:)
237 READ(41,rec=irec) zinter(:)
240 READ(41,rec=irec) zinter(:)
243 READ(41,rec=irec) zinter(:)
250 ELSEIF (kfile==2)
THEN 257 IF (jvegtype.EQ.8 .AND. kfile.EQ.1 .OR. jvegtype.EQ.9 .AND. kfile.EQ.
THEN 266 IF (
lhook)
CALL dr_hook(
'READ_COVERS_PARAM:READ_NATURE',1,zhook_handle)
real, dimension(:,:), allocatable xdata_irrig
real, dimension(:,:), allocatable xdata_hc_roof
real, dimension(:), allocatable xdata_alb_road
type(date_time), dimension(:,:), pointer tdata_seed
real, dimension(:), allocatable xdata_emis_wall
real, dimension(:,:), allocatable xdata_d_roof
real, dimension(:), allocatable xdata_bld
real, dimension(:,:,:), allocatable xdata_alb_soil_nir
real, dimension(:,:,:), allocatable xdata_lai_all_years
real, dimension(:,:), allocatable xdata_root_depth
subroutine read_covers_param(KFILE)
real, dimension(:), allocatable xdata_le_traffic
real, dimension(:,:), allocatable xdata_vegtype
real, dimension(:), allocatable xdata_water
real, dimension(:,:), allocatable xdata_tc_road
real, dimension(:), allocatable xdata_wall_o_hor
subroutine abor1_sfx(YTEXT)
real, dimension(:,:), allocatable xdata_hc_wall
real, dimension(:), allocatable xdata_sea
type(date_time), dimension(:,:), pointer tdata_reap
real, dimension(:), allocatable xdata_alb_wall
real, dimension(:,:), allocatable xdata_tc_roof
real, dimension(:,:), allocatable xdata_d_road
real, dimension(:,:,:), allocatable xdata_alb_veg_nir
real, dimension(:), allocatable xdata_emis_road
real, dimension(:,:), allocatable xdata_dice
real, dimension(:), allocatable xdata_h_traffic
real, dimension(:,:), allocatable xdata_h_tree
real, dimension(:,:,:), allocatable xdata_alb_veg_vis
real, dimension(:,:,:), allocatable xdata_lai
real, dimension(:), allocatable xdata_garden
real, dimension(:,:), allocatable xdata_watsup
real, dimension(:), allocatable xdata_le_industry
real, dimension(:), allocatable xdata_bld_height
real, dimension(:,:), allocatable xdata_tc_wall
real, dimension(:), allocatable xdata_h_industry
real, dimension(:,:), allocatable xdata_ground_depth
real, dimension(:), allocatable xdata_z0_town
real, dimension(:), allocatable xdata_emis_roof
real, dimension(:), allocatable xdata_alb_roof
real, dimension(:,:), allocatable xdata_hc_road
real, dimension(:), allocatable xdata_town
real, dimension(:,:,:), allocatable xdata_alb_soil_vis
real, dimension(:), allocatable xdata_nature
real, dimension(:,:), allocatable xdata_d_wall