Ignore:
Timestamp:
Jul 20, 2024, 12:00:23 PM (2 months ago)
Author:
abarral
Message:

remove fixed-form \s+& remaining in .f90,.F90

File:
1 edited

Legend:

Unmodified
Added
Removed
  • LMDZ6/branches/Amaury_dev/libf/misc/ioipsl_getincom.F90

    r1907 r5087  
    1313USE ioipsl_errioipsl, ONLY : ipslerr
    1414USE ioipsl_stringop, &
    15  &   ONLY : nocomma,cmpblank,strlowercase
     15     ONLY : nocomma,cmpblank,strlowercase
    1616!-
    1717IMPLICIT NONE
     
    3939!!--------------------------------------------------------------------
    4040  MODULE PROCEDURE getinrs, getinr1d, getinr2d, &
    41  &                 getinis, getini1d, getini2d, &
    42  &                 getincs, getinc1d, getinc2d, &
    43  &                 getinls, getinl1d, getinl2d
     41                   getinis, getini1d, getini2d, &
     42                   getincs, getinc1d, getinc2d, &
     43                   getinls, getinl1d, getinl2d
    4444END INTERFACE
    4545!-
     
    102102  CHARACTER(LEN=l_n) :: keystr
    103103  INTEGER :: keystatus, keytype, keycompress, &
    104  &           keyfromfile, keymemstart, keymemlen
     104             keyfromfile, keymemstart, keymemlen
    105105END TYPE t_key
    106106!-
     
    142142!-- Put the data into the database
    143143    CALL get_wdb &
    144  &   (target,status,fileorig,1,i_val=tmp_ret_val)
     144     (target,status,fileorig,1,i_val=tmp_ret_val)
    145145  ELSE
    146146!-- Get the value out of the database
     
    182182!-- Put the data into the database
    183183    CALL get_wdb &
    184  &   (target,status,fileorig,size_of_in,i_val=tmp_ret_val)
     184     (target,status,fileorig,size_of_in,i_val=tmp_ret_val)
    185185  ELSE
    186186!-- Get the value out of the database
     
    232232!-- Put the data into the database
    233233    CALL get_wdb &
    234  &   (target,status,fileorig,size_of_in,i_val=tmp_ret_val)
     234     (target,status,fileorig,size_of_in,i_val=tmp_ret_val)
    235235  ELSE
    236236!-- Get the value out of the database
     
    272272!-- Put the data into the database
    273273    CALL get_wdb &
    274  &   (target,status,fileorig,1,r_val=tmp_ret_val)
     274     (target,status,fileorig,1,r_val=tmp_ret_val)
    275275  ELSE
    276276!-- Get the value out of the database
     
    312312!-- Put the data into the database
    313313    CALL get_wdb &
    314  &   (target,status,fileorig,size_of_in,r_val=tmp_ret_val)
     314     (target,status,fileorig,size_of_in,r_val=tmp_ret_val)
    315315  ELSE
    316316!-- Get the value out of the database
     
    362362!-- Put the data into the database
    363363    CALL get_wdb &
    364  &   (target,status,fileorig,size_of_in,r_val=tmp_ret_val)
     364     (target,status,fileorig,size_of_in,r_val=tmp_ret_val)
    365365  ELSE
    366366!-- Get the value out of the database
     
    402402!-- Put the data into the database
    403403    CALL get_wdb &
    404  &   (target,status,fileorig,1,c_val=tmp_ret_val)
     404     (target,status,fileorig,1,c_val=tmp_ret_val)
    405405  ELSE
    406406!-- Get the value out of the database
     
    442442!-- Put the data into the database
    443443    CALL get_wdb &
    444  &   (target,status,fileorig,size_of_in,c_val=tmp_ret_val)
     444     (target,status,fileorig,size_of_in,c_val=tmp_ret_val)
    445445  ELSE
    446446!-- Get the value out of the database
     
    492492!-- Put the data into the database
    493493    CALL get_wdb &
    494  &   (target,status,fileorig,size_of_in,c_val=tmp_ret_val)
     494     (target,status,fileorig,size_of_in,c_val=tmp_ret_val)
    495495  ELSE
    496496!-- Get the value out of the database
     
    532532!-- Put the data into the database
    533533    CALL get_wdb &
    534  &   (target,status,fileorig,1,l_val=tmp_ret_val)
     534     (target,status,fileorig,1,l_val=tmp_ret_val)
    535535  ELSE
    536536!-- Get the value out of the database
     
    572572!-- Put the data into the database
    573573    CALL get_wdb &
    574  &   (target,status,fileorig,size_of_in,l_val=tmp_ret_val)
     574     (target,status,fileorig,size_of_in,l_val=tmp_ret_val)
    575575  ELSE
    576576!-- Get the value out of the database
     
    622622!-- Put the data into the database
    623623    CALL get_wdb &
    624  &   (target,status,fileorig,size_of_in,l_val=tmp_ret_val)
     624     (target,status,fileorig,size_of_in,l_val=tmp_ret_val)
    625625  ELSE
    626626!-- Get the value out of the database
     
    687687  CASE DEFAULT
    688688    CALL ipslerr (3,'get_fil', &
    689  &   'Internal error','Unknown type of data',' ')
     689     'Internal error','Unknown type of data',' ')
    690690  END SELECT
    691691!-
     
    726726!-----
    727727      IF (    (TRIM(str_READ_lower) == 'def')     &
    728  &        .OR.(TRIM(str_READ_lower) == 'default') ) THEN
     728          .OR.(TRIM(str_READ_lower) == 'default') ) THEN
    729729        def_beha = .TRUE.
    730730      ELSE
     
    736736          WRITE (UNIT=c_fmt,FMT='("(I",I3.3,")")') len_str
    737737          READ (UNIT=str_READ(1:len_str), &
    738  &              FMT=c_fmt,IOSTAT=io_err) i_val(it)
     738                FMT=c_fmt,IOSTAT=io_err) i_val(it)
    739739        CASE(k_r)
    740740          READ (UNIT=str_READ(1:len_str), &
    741  &              FMT=*,IOSTAT=io_err) r_val(it)
     741                FMT=*,IOSTAT=io_err) r_val(it)
    742742        CASE(k_c)
    743743          c_val(it) = str_READ(1:len_str)
     
    746746          ipos_fl = -1
    747747          ipos_tr = MAX(INDEX(str_READ_lower,'tru'), &
    748  &                      INDEX(str_READ_lower,'y'))
     748                        INDEX(str_READ_lower,'y'))
    749749          ipos_fl = MAX(INDEX(str_READ_lower,'fal'), &
    750  &                      INDEX(str_READ_lower,'n'))
     750                        INDEX(str_READ_lower,'n'))
    751751          IF (ipos_tr > 0) THEN
    752752            l_val(it) = .TRUE.
     
    759759        IF (io_err /= 0) THEN
    760760          CALL ipslerr (3,'get_fil', &
    761  &         'Target '//TRIM(target), &
    762  &         'is not of '//TRIM(c_vtyp)//' type',' ')
     761           'Target '//TRIM(target), &
     762           'is not of '//TRIM(c_vtyp)//' type',' ')
    763763        ENDIF
    764764      ENDIF
     
    771771          IF (compline(pos) /= nb_to_ret) THEN
    772772            CALL ipslerr (2,'get_fil', &
    773  &           'For key '//TRIM(target)//' we have a compressed field', &
    774  &           'which does not have the right size.', &
    775  &           'We will try to fix that.')
     773             'For key '//TRIM(target)//' we have a compressed field', &
     774             'which does not have the right size.', &
     775             'We will try to fix that.')
    776776          ENDIF
    777777          IF      (k_typ == k_i) THEN
     
    816816        IF      (status_cnt <= max_msgs) THEN
    817817          WRITE (UNIT=*,FMT='(" USING DEFAULTS : ",A)', &
    818  &               ADVANCE='NO') TRIM(target)
     818                 ADVANCE='NO') TRIM(target)
    819819          IF (nb_to_ret > 1) THEN
    820820            WRITE (UNIT=*,FMT='("__")',ADVANCE='NO')
     
    870870  CALL get_qtyp (k_typ,c_vtyp,i_val,r_val,c_val,l_val)
    871871  IF (     (k_typ /= k_i).AND.(k_typ /= k_r) &
    872  &    .AND.(k_typ /= k_c).AND.(k_typ /= k_l) )THEN
     872      .AND.(k_typ /= k_c).AND.(k_typ /= k_l) )THEN
    873873    CALL ipslerr (3,'get_rdb', &
    874  &   'Internal error','Unknown type of data',' ')
     874     'Internal error','Unknown type of data',' ')
    875875  ENDIF
    876876!-
    877877  IF (key_tab(pos)%keytype /= k_typ) THEN
    878878    CALL ipslerr (3,'get_rdb', &
    879  &   'Wrong data type for keyword '//TRIM(target), &
    880  &   '(NOT '//TRIM(c_vtyp)//')',' ')
     879     'Wrong data type for keyword '//TRIM(target), &
     880     '(NOT '//TRIM(c_vtyp)//')',' ')
    881881  ENDIF
    882882!-
    883883  IF (key_tab(pos)%keycompress > 0) THEN
    884884    IF (    (key_tab(pos)%keycompress /= size_of_in) &
    885  &      .OR.(key_tab(pos)%keymemlen /= 1) ) THEN
     885        .OR.(key_tab(pos)%keymemlen /= 1) ) THEN
    886886      CALL ipslerr (3,'get_rdb', &
    887  &     'Wrong compression length','for keyword '//TRIM(target),' ')
     887       'Wrong compression length','for keyword '//TRIM(target),' ')
    888888    ELSE
    889889      SELECT CASE (k_typ)
     
    897897    IF (key_tab(pos)%keymemlen /= size_of_in) THEN
    898898      CALL ipslerr (3,'get_rdb', &
    899  &     'Wrong array length','for keyword '//TRIM(target),' ')
     899       'Wrong array length','for keyword '//TRIM(target),' ')
    900900    ELSE
    901901      k_beg = key_tab(pos)%keymemstart
     
    917917!===
    918918SUBROUTINE get_wdb &
    919  &  (target,status,fileorig,size_of_in, &
    920  &   i_val,r_val,c_val,l_val)
     919    (target,status,fileorig,size_of_in, &
     920     i_val,r_val,c_val,l_val)
    921921!---------------------------------------------------------------------
    922922!- Write data into the data base
     
    940940  CALL get_qtyp (k_typ,c_vtyp,i_val,r_val,c_val,l_val)
    941941  IF (     (k_typ /= k_i).AND.(k_typ /= k_r) &
    942  &    .AND.(k_typ /= k_c).AND.(k_typ /= k_l) )THEN
     942      .AND.(k_typ /= k_c).AND.(k_typ /= k_l) )THEN
    943943    CALL ipslerr (3,'get_wdb', &
    944  &   'Internal error','Unknown type of data',' ')
     944     'Internal error','Unknown type of data',' ')
    945945  ENDIF
    946946!-
     
    954954    k_mempos = i_mempos; k_memsize = i_memsize;
    955955    l_cmp = (MINVAL(i_val) == MAXVAL(i_val)) &
    956  &         .AND.(size_of_in > compress_lim)
     956           .AND.(size_of_in > compress_lim)
    957957  CASE(k_r)
    958958    k_mempos = r_mempos; k_memsize = r_memsize;
    959959    l_cmp = (MINVAL(r_val) == MAXVAL(r_val)) &
    960  &         .AND.(size_of_in > compress_lim)
     960           .AND.(size_of_in > compress_lim)
    961961  CASE(k_c)
    962962    k_mempos = c_mempos; k_memsize = c_memsize;
     
    984984! Before writing the actual size lets see if we have the space
    985985  IF (key_tab(nb_keys)%keymemstart+key_tab(nb_keys)%keymemlen &
    986  &    > k_memsize) THEN
     986      > k_memsize) THEN
    987987    CALL getin_allocmem (k_typ,key_tab(nb_keys)%keymemlen)
    988988  ENDIF
     
    10701070  IF (io_err /= 0) THEN
    10711071    CALL ipslerr (2,'getin_readdef', &
    1072  &  'Could not open file '//TRIM(filelist(current)),' ',' ')
     1072    'Could not open file '//TRIM(filelist(current)),' ',' ')
    10731073    RETURN
    10741074  ENDIF
     
    10871087      IF (iund > 0) THEN
    10881088        WRITE (UNIT=c_fmt,FMT='("(I",I3.3,")")') &
    1089  &        LEN_TRIM(key_str)-iund-1
     1089          LEN_TRIM(key_str)-iund-1
    10901090        READ(UNIT=key_str(iund+2:LEN_TRIM(key_str)), &
    1091  &           FMT=c_fmt,IOSTAT=io_err) it
     1091             FMT=c_fmt,IOSTAT=io_err) it
    10921092        IF ( (io_err == 0).AND.(it > 0) ) THEN
    10931093          WRITE(UNIT=cnt,FMT=c_i_fmt) it
     
    10951095        ELSE
    10961096          CALL ipslerr (3,'getin_readdef', &
    1097  &         'A very strange key has just been found :', &
    1098  &         TRIM(key_str),' ')
     1097           'A very strange key has just been found :', &
     1098           TRIM(key_str),' ')
    10991099        ENDIF
    11001100      ENDIF
     
    11061106      IF (check) THEN
    11071107        WRITE(*,*) &
    1108  &        '--> getin_readdef : ',TRIM(key_str),' :: ',TRIM(NEW_str)
     1108          '--> getin_readdef : ',TRIM(key_str),' :: ',TRIM(NEW_str)
    11091109      ENDIF
    11101110!---- Decypher the content of NEW_str
     
    11261126          IF (nb_lastkey /= 1) THEN
    11271127            CALL ipslerr (3,'getin_readdef', &
    1128  &           'We can not have a scalar keyword', &
    1129  &           'and a vector content',' ')
     1128             'We can not have a scalar keyword', &
     1129             'and a vector content',' ')
    11301130          ENDIF
    11311131!-------- The last keyword needs to be transformed into a vector.
    11321132          WRITE(UNIT=cnt,FMT=c_i_fmt) 1
    11331133          targetlist(nb_lines) = &
    1134  &         last_key(1:MIN(LEN_TRIM(last_key),l_n-n_d_fmt-2))//'__'//cnt
     1134           last_key(1:MIN(LEN_TRIM(last_key),l_n-n_d_fmt-2))//'__'//cnt
    11351135          key_str = last_key(1:LEN_TRIM(last_key))
    11361136        ENDIF
     
    11931193      IF (nbfiles+1 > max_files) THEN
    11941194        CALL ipslerr (3,'getin_decrypt', &
    1195  &       'Too many files to include',' ',' ')
     1195         'Too many files to include',' ',' ')
    11961196      ENDIF
    11971197!-----
     
    12051205    IF (nbfiles+1 > max_files) THEN
    12061206      CALL ipslerr (3,'getin_decrypt', &
    1207  &     'Too many files to include',' ',' ')
     1207       'Too many files to include',' ',' ')
    12081208    ENDIF
    12091209!---
     
    12271227    starpos = INDEX(NEW_str(1:len_str),'*')
    12281228    IF ( (starpos > 0).AND.(tmp_str(1:1) /= '"') &
    1229  &                    .AND.(tmp_str(1:1) /= "'") ) THEN
     1229                      .AND.(tmp_str(1:1) /= "'") ) THEN
    12301230!-----
    12311231      IF (INDEX(key_str(1:LEN_TRIM(key_str)),'__') > 0) THEN
    12321232        CALL ipslerr (3,'getin_decrypt', &
    1233  &       'We can not have a compressed field of values', &
    1234  &       'in a vector notation (TARGET__n).', &
    1235  &       'The key at fault : '//TRIM(key_str))
     1233         'We can not have a compressed field of values', &
     1234         'in a vector notation (TARGET__n).', &
     1235         'The key at fault : '//TRIM(key_str))
    12361236      ENDIF
    12371237!-
     
    12451245      IF (blk > 1) THEN
    12461246        CALL ipslerr (2,'getin_decrypt', &
    1247  &       'This is a strange behavior','you could report',' ')
     1247         'This is a strange behavior','you could report',' ')
    12481248      ENDIF
    12491249      WRITE (UNIT=c_fmt,FMT='("(I",I5.5,")")') LEN_TRIM(mult)
     
    12591259!-
    12601260    IF (    (blk <= 1) &
    1261  &      .OR.(tmp_str(1:1) == '"') &
    1262  &      .OR.(tmp_str(1:1) == "'") ) THEN
     1261        .OR.(tmp_str(1:1) == '"') &
     1262        .OR.(tmp_str(1:1) == "'") ) THEN
    12631263!-
    12641264      IF (nb_lastkey == 0) THEN
     
    12731273        WRITE(UNIT=cnt,FMT=c_i_fmt) nb_lastkey+1
    12741274        targetlist(nb_lines) = &
    1275  &        key_str(1:MIN(LEN_TRIM(key_str),l_n-n_d_fmt-2))//'__'//cnt
     1275          key_str(1:MIN(LEN_TRIM(key_str),l_n-n_d_fmt-2))//'__'//cnt
    12761276        last_key = &
    1277  &        key_str(1:MIN(LEN_TRIM(key_str),l_n-n_d_fmt-2))//'__'//cnt
     1277          key_str(1:MIN(LEN_TRIM(key_str),l_n-n_d_fmt-2))//'__'//cnt
    12781278        nb_lastkey = nb_lastkey+1
    12791279      ENDIF
     
    12911291      IF (INDEX(TRIM(key_str),'__') > 0) THEN
    12921292        CALL ipslerr (3,'getin_decrypt', &
    1293  &       'We have found a mixed vector notation (TARGET__n).', &
    1294  &       'The key at fault : '//TRIM(key_str),' ')
     1293         'We have found a mixed vector notation (TARGET__n).', &
     1294         'The key at fault : '//TRIM(key_str),' ')
    12951295      ENDIF
    12961296!-
     
    13051305        fichier(nb_lines) = tmp_str(1:blk)
    13061306        new_key = &
    1307  &       key_str(1:MIN(LEN_TRIM(key_str),l_n-n_d_fmt-2))//'__'//cnt
     1307         key_str(1:MIN(LEN_TRIM(key_str),l_n-n_d_fmt-2))//'__'//cnt
    13081308        targetlist(nb_lines) = new_key(1:MIN(LEN_TRIM(new_key),l_n))
    13091309        fromfile(nb_lines) = current
     
    13251325      fichier(nb_lines) = tmp_str(1:LEN_TRIM(tmp_str))
    13261326      new_key = &
    1327  &      key_str(1:MIN(LEN_TRIM(key_str),l_n-n_d_fmt-2))//'__'//cnt
     1327        key_str(1:MIN(LEN_TRIM(key_str),l_n-n_d_fmt-2))//'__'//cnt
    13281328      targetlist(nb_lines) = new_key(1:MIN(LEN_TRIM(new_key),l_n))
    13291329      fromfile(nb_lines) = current
    13301330!-
    13311331      last_key = &
    1332  &      key_str(1:MIN(LEN_TRIM(key_str),l_n-n_d_fmt-2))//'__'//cnt
     1332        key_str(1:MIN(LEN_TRIM(key_str),l_n-n_d_fmt-2))//'__'//cnt
    13331333      nb_lastkey = nbve
    13341334!-
     
    13641364      WRITE(*,*) 'COUNT : ',n_k
    13651365      WRITE(*,*) &
    1366  &  'getin_checkcohe : Found a problem on key ',TRIM(targetlist(line))
     1366    'getin_checkcohe : Found a problem on key ',TRIM(targetlist(line))
    13671367      WRITE(*,*) &
    1368  &  'getin_checkcohe : The following values were encoutered :'
     1368    'getin_checkcohe : The following values were encoutered :'
    13691369      WRITE(*,*) &
    1370  &  '                ',TRIM(targetlist(line)),' == ',fichier(line)
     1370    '                ',TRIM(targetlist(line)),' == ',fichier(line)
    13711371      WRITE(*,*) &
    1372  &  '                ',TRIM(targetlist(k)),' == ',fichier(k)
     1372    '                ',TRIM(targetlist(k)),' == ',fichier(k)
    13731373      WRITE(*,*) &
    1374  &  'getin_checkcohe : We will keep only the last value'
     1374    'getin_checkcohe : We will keep only the last value'
    13751375      targetlist(line) = ' '
    13761376    ENDIF
     
    14341434    IF (ier /= 0) THEN
    14351435      CALL ipslerr (3,'getin_allockeys', &
    1436  &     'Can not allocate key_tab', &
    1437  &     'to size '//TRIM(ADJUSTL(c_tmp)),' ')
     1436       'Can not allocate key_tab', &
     1437       'to size '//TRIM(ADJUSTL(c_tmp)),' ')
    14381438    ENDIF
    14391439    nb_keys = 0
     
    14501450    IF (ier /= 0) THEN
    14511451      CALL ipslerr (3,'getin_allockeys', &
    1452  &     'Can not allocate tmp_key_tab', &
    1453  &     'to size '//TRIM(ADJUSTL(c_tmp)),' ')
     1452       'Can not allocate tmp_key_tab', &
     1453       'to size '//TRIM(ADJUSTL(c_tmp)),' ')
    14541454    ENDIF
    14551455    WRITE (UNIT=c_tmp,FMT=*) keymemsize+memslabs
     
    14591459    IF (ier /= 0) THEN
    14601460      CALL ipslerr (3,'getin_allockeys', &
    1461  &     'Can not allocate key_tab', &
    1462  &     'to size '//TRIM(ADJUSTL(c_tmp)),' ')
     1461       'Can not allocate key_tab', &
     1462       'to size '//TRIM(ADJUSTL(c_tmp)),' ')
    14631463    ENDIF
    14641464    key_tab(:)%keycompress = -1
     
    14951495        WRITE (UNIT=c_tmp,FMT=*) memslabs
    14961496        CALL ipslerr (3,'getin_allocmem', &
    1497  &       'Unable to allocate db-memory', &
    1498  &       'i_mem to size '//TRIM(ADJUSTL(c_tmp)),' ')
     1497         'Unable to allocate db-memory', &
     1498         'i_mem to size '//TRIM(ADJUSTL(c_tmp)),' ')
    14991499      ENDIF
    15001500      i_memsize=memslabs
     
    15041504        WRITE (UNIT=c_tmp,FMT=*) i_memsize
    15051505        CALL ipslerr (3,'getin_allocmem', &
    1506  &       'Unable to allocate tmp_int', &
    1507  &       'to size '//TRIM(ADJUSTL(c_tmp)),' ')
     1506         'Unable to allocate tmp_int', &
     1507         'to size '//TRIM(ADJUSTL(c_tmp)),' ')
    15081508      ENDIF
    15091509      tmp_int(1:i_memsize) = i_mem(1:i_memsize)
     
    15131513        WRITE (UNIT=c_tmp,FMT=*) i_memsize+MAX(memslabs,len_wanted)
    15141514        CALL ipslerr (3,'getin_allocmem', &
    1515  &       'Unable to re-allocate db-memory', &
    1516  &       'i_mem to size '//TRIM(ADJUSTL(c_tmp)),' ')
     1515         'Unable to re-allocate db-memory', &
     1516         'i_mem to size '//TRIM(ADJUSTL(c_tmp)),' ')
    15171517      ENDIF
    15181518      i_mem(1:i_memsize) = tmp_int(1:i_memsize)
     
    15261526        WRITE (UNIT=c_tmp,FMT=*) memslabs
    15271527        CALL ipslerr (3,'getin_allocmem', &
    1528  &       'Unable to allocate db-memory', &
    1529  &       'r_mem to size '//TRIM(ADJUSTL(c_tmp)),' ')
     1528         'Unable to allocate db-memory', &
     1529         'r_mem to size '//TRIM(ADJUSTL(c_tmp)),' ')
    15301530      ENDIF
    15311531      r_memsize =  memslabs
     
    15351535        WRITE (UNIT=c_tmp,FMT=*) r_memsize
    15361536        CALL ipslerr (3,'getin_allocmem', &
    1537  &       'Unable to allocate tmp_real', &
    1538  &       'to size '//TRIM(ADJUSTL(c_tmp)),' ')
     1537         'Unable to allocate tmp_real', &
     1538         'to size '//TRIM(ADJUSTL(c_tmp)),' ')
    15391539      ENDIF
    15401540      tmp_real(1:r_memsize) = r_mem(1:r_memsize)
     
    15441544        WRITE (UNIT=c_tmp,FMT=*) r_memsize+MAX(memslabs,len_wanted)
    15451545        CALL ipslerr (3,'getin_allocmem', &
    1546  &       'Unable to re-allocate db-memory', &
    1547  &       'r_mem to size '//TRIM(ADJUSTL(c_tmp)),' ')
     1546         'Unable to re-allocate db-memory', &
     1547         'r_mem to size '//TRIM(ADJUSTL(c_tmp)),' ')
    15481548      ENDIF
    15491549      r_mem(1:r_memsize) = tmp_real(1:r_memsize)
     
    15571557        WRITE (UNIT=c_tmp,FMT=*) memslabs
    15581558        CALL ipslerr (3,'getin_allocmem', &
    1559  &       'Unable to allocate db-memory', &
    1560  &       'c_mem to size '//TRIM(ADJUSTL(c_tmp)),' ')
     1559         'Unable to allocate db-memory', &
     1560         'c_mem to size '//TRIM(ADJUSTL(c_tmp)),' ')
    15611561      ENDIF
    15621562      c_memsize = memslabs
     
    15661566        WRITE (UNIT=c_tmp,FMT=*) c_memsize
    15671567        CALL ipslerr (3,'getin_allocmem', &
    1568  &       'Unable to allocate tmp_char', &
    1569  &       'to size '//TRIM(ADJUSTL(c_tmp)),' ')
     1568         'Unable to allocate tmp_char', &
     1569         'to size '//TRIM(ADJUSTL(c_tmp)),' ')
    15701570      ENDIF
    15711571      tmp_char(1:c_memsize) = c_mem(1:c_memsize)
     
    15751575        WRITE (UNIT=c_tmp,FMT=*) c_memsize+MAX(memslabs,len_wanted)
    15761576        CALL ipslerr (3,'getin_allocmem', &
    1577  &       'Unable to re-allocate db-memory', &
    1578  &       'c_mem to size '//TRIM(ADJUSTL(c_tmp)),' ')
     1577         'Unable to re-allocate db-memory', &
     1578         'c_mem to size '//TRIM(ADJUSTL(c_tmp)),' ')
    15791579      ENDIF
    15801580      c_mem(1:c_memsize) = tmp_char(1:c_memsize)
     
    15881588        WRITE (UNIT=c_tmp,FMT=*) memslabs
    15891589        CALL ipslerr (3,'getin_allocmem', &
    1590  &       'Unable to allocate db-memory', &
    1591  &       'l_mem to size '//TRIM(ADJUSTL(c_tmp)),' ')
     1590         'Unable to allocate db-memory', &
     1591         'l_mem to size '//TRIM(ADJUSTL(c_tmp)),' ')
    15921592      ENDIF
    15931593      l_memsize = memslabs
     
    15971597        WRITE (UNIT=c_tmp,FMT=*) l_memsize
    15981598        CALL ipslerr (3,'getin_allocmem', &
    1599  &       'Unable to allocate tmp_logic', &
    1600  &       'to size '//TRIM(ADJUSTL(c_tmp)),' ')
     1599         'Unable to allocate tmp_logic', &
     1600         'to size '//TRIM(ADJUSTL(c_tmp)),' ')
    16011601      ENDIF
    16021602      tmp_logic(1:l_memsize) = l_mem(1:l_memsize)
     
    16061606        WRITE (UNIT=c_tmp,FMT=*) l_memsize+MAX(memslabs,len_wanted)
    16071607        CALL ipslerr (3,'getin_allocmem', &
    1608  &       'Unable to re-allocate db-memory', &
    1609  &       'l_mem to size '//TRIM(ADJUSTL(c_tmp)),' ')
     1608         'Unable to re-allocate db-memory', &
     1609         'l_mem to size '//TRIM(ADJUSTL(c_tmp)),' ')
    16101610      ENDIF
    16111611      l_mem(1:l_memsize) = tmp_logic(1:l_memsize)
     
    16401640    IF (ier /= 0) THEN
    16411641      CALL ipslerr (3,'getin_alloctxt', &
    1642  &     'Can not allocate fichier', &
    1643  &     'to size '//TRIM(ADJUSTL(c_tmp1)),' ')
     1642       'Can not allocate fichier', &
     1643       'to size '//TRIM(ADJUSTL(c_tmp1)),' ')
    16441644    ENDIF
    16451645!---
     
    16471647    IF (ier /= 0) THEN
    16481648      CALL ipslerr (3,'getin_alloctxt', &
    1649  &     'Can not allocate targetlist', &
    1650  &     'to size '//TRIM(ADJUSTL(c_tmp1)),' ')
     1649       'Can not allocate targetlist', &
     1650       'to size '//TRIM(ADJUSTL(c_tmp1)),' ')
    16511651    ENDIF
    16521652!---
     
    16541654    IF (ier /= 0) THEN
    16551655      CALL ipslerr (3,'getin_alloctxt', &
    1656  &     'Can not allocate fromfile', &
    1657  &     'to size '//TRIM(ADJUSTL(c_tmp1)),' ')
     1656       'Can not allocate fromfile', &
     1657       'to size '//TRIM(ADJUSTL(c_tmp1)),' ')
    16581658    ENDIF
    16591659!---
     
    16611661    IF (ier /= 0) THEN
    16621662      CALL ipslerr (3,'getin_alloctxt', &
    1663  &     'Can not allocate compline', &
    1664  &     'to size '//TRIM(ADJUSTL(c_tmp1)),' ')
     1663       'Can not allocate compline', &
     1664       'to size '//TRIM(ADJUSTL(c_tmp1)),' ')
    16651665    ENDIF
    16661666!---
     
    16771677    IF (ier /= 0) THEN
    16781678      CALL ipslerr (3,'getin_alloctxt', &
    1679  &     'Can not allocate tmp_fic', &
    1680  &     'to size '//TRIM(ADJUSTL(c_tmp1)),' ')
     1679       'Can not allocate tmp_fic', &
     1680       'to size '//TRIM(ADJUSTL(c_tmp1)),' ')
    16811681    ENDIF
    16821682    tmp_fic(1:i_txtsize) = fichier(1:i_txtsize)
     
    16851685    IF (ier /= 0) THEN
    16861686      CALL ipslerr (3,'getin_alloctxt', &
    1687  &     'Can not allocate fichier', &
    1688  &     'to size '//TRIM(ADJUSTL(c_tmp2)),' ')
     1687       'Can not allocate fichier', &
     1688       'to size '//TRIM(ADJUSTL(c_tmp2)),' ')
    16891689    ENDIF
    16901690    fichier(1:i_txtsize) = tmp_fic(1:i_txtsize)
     
    16941694    IF (ier /= 0) THEN
    16951695      CALL ipslerr (3,'getin_alloctxt', &
    1696  &     'Can not allocate tmp_tgl', &
    1697  &     'to size '//TRIM(ADJUSTL(c_tmp1)),' ')
     1696       'Can not allocate tmp_tgl', &
     1697       'to size '//TRIM(ADJUSTL(c_tmp1)),' ')
    16981698    ENDIF
    16991699    tmp_tgl(1:i_txtsize) = targetlist(1:i_txtsize)
     
    17021702    IF (ier /= 0) THEN
    17031703      CALL ipslerr (3,'getin_alloctxt', &
    1704  &     'Can not allocate targetlist', &
    1705  &     'to size '//TRIM(ADJUSTL(c_tmp2)),' ')
     1704       'Can not allocate targetlist', &
     1705       'to size '//TRIM(ADJUSTL(c_tmp2)),' ')
    17061706    ENDIF
    17071707    targetlist(1:i_txtsize) = tmp_tgl(1:i_txtsize)
     
    17111711    IF (ier /= 0) THEN
    17121712      CALL ipslerr (3,'getin_alloctxt', &
    1713  &     'Can not allocate tmp_int', &
    1714  &     'to size '//TRIM(ADJUSTL(c_tmp1)),' ')
     1713       'Can not allocate tmp_int', &
     1714       'to size '//TRIM(ADJUSTL(c_tmp1)),' ')
    17151715    ENDIF
    17161716    tmp_int(1:i_txtsize) = fromfile(1:i_txtsize)
     
    17191719    IF (ier /= 0) THEN
    17201720      CALL ipslerr (3,'getin_alloctxt', &
    1721  &     'Can not allocate fromfile', &
    1722  &     'to size '//TRIM(ADJUSTL(c_tmp2)),' ')
     1721       'Can not allocate fromfile', &
     1722       'to size '//TRIM(ADJUSTL(c_tmp2)),' ')
    17231723    ENDIF
    17241724    fromfile(1:i_txtsize) = tmp_int(1:i_txtsize)
     
    17291729    IF (ier /= 0) THEN
    17301730      CALL ipslerr (3,'getin_alloctxt', &
    1731  &     'Can not allocate compline', &
    1732  &     'to size '//TRIM(ADJUSTL(c_tmp2)),' ')
     1731       'Can not allocate compline', &
     1732       'to size '//TRIM(ADJUSTL(c_tmp2)),' ')
    17331733    ENDIF
    17341734    compline(1:i_txtsize) = tmp_int(1:i_txtsize)
     
    17651765    IF (check) THEN
    17661766      WRITE(*,*) &
    1767  &      'GETIN_DUMP : opens file : ',TRIM(used_filename),' if = ',if
     1767        'GETIN_DUMP : opens file : ',TRIM(used_filename),' if = ',if
    17681768      WRITE(*,*) 'GETIN_DUMP : NUMBER OF KEYS : ',nb_keys
    17691769    ENDIF
     
    17921792        CASE(1)
    17931793          WRITE(22,*) '# Values of ', &
    1794  &          TRIM(key_tab(ikey)%keystr),' comes from the run.def.'
     1794            TRIM(key_tab(ikey)%keystr),' comes from the run.def.'
    17951795        CASE(2)
    17961796          WRITE(22,*) '# Values of ', &
    1797  &          TRIM(key_tab(ikey)%keystr),' are all defaults.'
     1797            TRIM(key_tab(ikey)%keystr),' are all defaults.'
    17981798        CASE(3)
    17991799          WRITE(22,*) '# Values of ', &
    1800  &          TRIM(key_tab(ikey)%keystr), &
    1801  &          ' are a mix of run.def and defaults.'
     1800            TRIM(key_tab(ikey)%keystr), &
     1801            ' are a mix of run.def and defaults.'
    18021802        CASE DEFAULT
    18031803          WRITE(22,*) '# Dont know from where the value of ', &
    1804  &          TRIM(key_tab(ikey)%keystr),' comes.'
     1804            TRIM(key_tab(ikey)%keystr),' comes.'
    18051805        END SELECT
    18061806        WRITE(22,*) '#'
     
    18121812            IF (key_tab(ikey)%keycompress < 0) THEN
    18131813              WRITE(22,*) &
    1814  &              TRIM(key_tab(ikey)%keystr), &
    1815  &              ' = ',i_mem(key_tab(ikey)%keymemstart)
     1814                TRIM(key_tab(ikey)%keystr), &
     1815                ' = ',i_mem(key_tab(ikey)%keymemstart)
    18161816            ELSE
    18171817              WRITE(22,*) &
    1818  &              TRIM(key_tab(ikey)%keystr), &
    1819  &              ' = ',key_tab(ikey)%keycompress, &
    1820  &              ' * ',i_mem(key_tab(ikey)%keymemstart)
     1818                TRIM(key_tab(ikey)%keystr), &
     1819                ' = ',key_tab(ikey)%keycompress, &
     1820                ' * ',i_mem(key_tab(ikey)%keymemstart)
    18211821            ENDIF
    18221822          ELSE
     
    18241824              WRITE(UNIT=c_tmp,FMT=c_i_fmt) iv+1
    18251825              WRITE(22,*) &
    1826  &              TRIM(key_tab(ikey)%keystr), &
    1827  &              '__',TRIM(ADJUSTL(c_tmp)), &
    1828  &              ' = ',i_mem(key_tab(ikey)%keymemstart+iv)
     1826                TRIM(key_tab(ikey)%keystr), &
     1827                '__',TRIM(ADJUSTL(c_tmp)), &
     1828                ' = ',i_mem(key_tab(ikey)%keymemstart+iv)
    18291829            ENDDO
    18301830          ENDIF
     
    18331833            IF (key_tab(ikey)%keycompress < 0) THEN
    18341834              WRITE(22,*) &
    1835  &              TRIM(key_tab(ikey)%keystr), &
    1836  &              ' = ',r_mem(key_tab(ikey)%keymemstart)
     1835                TRIM(key_tab(ikey)%keystr), &
     1836                ' = ',r_mem(key_tab(ikey)%keymemstart)
    18371837            ELSE
    18381838              WRITE(22,*) &
    1839  &              TRIM(key_tab(ikey)%keystr), &
    1840  &              ' = ',key_tab(ikey)%keycompress, &
    1841                    & ' * ',r_mem(key_tab(ikey)%keymemstart)
     1839                TRIM(key_tab(ikey)%keystr), &
     1840                ' = ',key_tab(ikey)%keycompress, &
     1841   ' * ',r_mem(key_tab(ikey)%keymemstart)
    18421842            ENDIF
    18431843          ELSE
     
    18451845              WRITE(UNIT=c_tmp,FMT=c_i_fmt) iv+1
    18461846              WRITE(22,*) &
    1847  &              TRIM(key_tab(ikey)%keystr),'__',TRIM(ADJUSTL(c_tmp)), &
    1848  &              ' = ',r_mem(key_tab(ikey)%keymemstart+iv)
     1847                TRIM(key_tab(ikey)%keystr),'__',TRIM(ADJUSTL(c_tmp)), &
     1848                ' = ',r_mem(key_tab(ikey)%keymemstart+iv)
    18491849            ENDDO
    18501850          ENDIF
     
    18531853            tmp_str = c_mem(key_tab(ikey)%keymemstart)
    18541854            WRITE(22,*) TRIM(key_tab(ikey)%keystr), &
    1855  &              ' = ',TRIM(tmp_str)
     1855                ' = ',TRIM(tmp_str)
    18561856          ELSE
    18571857            DO iv=0,key_tab(ikey)%keymemlen-1
     
    18591859              tmp_str = c_mem(key_tab(ikey)%keymemstart+iv)
    18601860              WRITE(22,*) &
    1861  &              TRIM(key_tab(ikey)%keystr), &
    1862  &              '__',TRIM(ADJUSTL(c_tmp)), &
    1863  &              ' = ',TRIM(tmp_str)
     1861                TRIM(key_tab(ikey)%keystr), &
     1862                '__',TRIM(ADJUSTL(c_tmp)), &
     1863                ' = ',TRIM(tmp_str)
    18641864            ENDDO
    18651865          ENDIF
     
    18761876              IF (l_mem(key_tab(ikey)%keymemstart+iv)) THEN
    18771877                WRITE(22,*) TRIM(key_tab(ikey)%keystr),'__', &
    1878  &                          TRIM(ADJUSTL(c_tmp)),' = TRUE '
     1878                            TRIM(ADJUSTL(c_tmp)),' = TRUE '
    18791879              ELSE
    18801880                WRITE(22,*) TRIM(key_tab(ikey)%keystr),'__', &
    1881  &                          TRIM(ADJUSTL(c_tmp)),' = FALSE '
     1881                            TRIM(ADJUSTL(c_tmp)),' = FALSE '
    18821882              ENDIF
    18831883            ENDDO
     
    18851885        CASE DEFAULT
    18861886          CALL ipslerr (3,'getin_dump', &
    1887  &         'Unknown type for variable '//TRIM(key_tab(ikey)%keystr), &
    1888  &         ' ',' ')
     1887           'Unknown type for variable '//TRIM(key_tab(ikey)%keystr), &
     1888           ' ',' ')
    18891889        END SELECT
    18901890      ENDIF
     
    19121912  k_typ = 0
    19131913  IF (COUNT((/PRESENT(i_v),PRESENT(r_v),PRESENT(c_v),PRESENT(l_v)/)) &
    1914  &    /= 1) THEN
     1914      /= 1) THEN
    19151915    CALL ipslerr (3,'get_qtyp', &
    1916  &   'Invalid number of optional arguments','(/= 1)',' ')
     1916     'Invalid number of optional arguments','(/= 1)',' ')
    19171917  ENDIF
    19181918!-
Note: See TracChangeset for help on using the changeset viewer.