Ignore:
Timestamp:
Apr 17, 2015, 10:30:37 PM (10 years ago)
Author:
millour
Message:

Further cleanup and removal of references to iniprint.h.
Also added bench testcase 48x36x19.
EM

File:
1 edited

Legend:

Unmodified
Added
Removed
  • dynamico_lmdz/aquaplanet/LMDZ5/libf/phylmd/infotrac_phy.f90

    r3816 r3817  
    6060    nbtr=nbtr_
    6161    ALLOCATE(tname(nqtot))
     62    tname(:) = tname_(:)
    6263    ALLOCATE(ttext(nqtot))
    63     ALLOCATE(niadv(nqtot))
    64     tname(:) = tname_(:)
    6564    ttext(:) = ttext_(:)
    66     niadv(:) = niadv_(:)
    6765    ALLOCATE(niadv(nqtot))
    6866    niadv(:)=niadv_(:)
     
    7472    solsym(:)=solsym_(:)
    7573 
     74    write(*,*) "init_infotrac_phy: nqtot,nqo,nbtr",nqtot,nqo,nbtr
     75 
    7676  END SUBROUTINE init_infotrac_phy
    7777 
Note: See TracChangeset for help on using the changeset viewer.