source: LMDZ6/branches/Amaury_dev/libf/obsolete/eigen.f90 @ 5119

Last change on this file since 5119 was 5119, checked in by abarral, 2 months ago

enforce PRIVATE by default in several modules, expose PUBLIC as needed
move eigen.f90 to obsolete/
(lint) aslong the way

  • Property copyright set to
    Name of program: LMDZ
    Creation date: 1984
    Version: LMDZ5
    License: CeCILL version 2
    Holder: Laboratoire de m\'et\'eorologie dynamique, CNRS, UMR 8539
    See the license file in the root directory
  • Property svn:eol-style set to native
  • Property svn:keywords set to Author Date Id Revision
File size: 598 bytes
RevLine 
[5107]1! Amaury: code de <=2004 utilisé nulle part, pas de trace dans la recherche TRAC
[5099]2
[5105]3SUBROUTINE eigen( e,d)
4  IMPLICIT NONE
5  INCLUDE "dimensions.h"
[5116]6  REAL :: e( iim,iim ), d( iim )
7  REAL :: asm( iim )
8  INTEGER :: im,i,j
[5105]9  im=iim
10  !
11  DO i = 1,im
12     asm( i ) = d( im-i+1 )
13  END DO
14  DO i = 1,iim
15     d( i ) = asm( i )
16  END DO
17  !
18  ! PRINT 70,d
[524]19 70   FORMAT(5x,'Valeurs propres',/,8(1x,8f10.4,/),/)
[5105]20            print *
21  !
22  DO i = 1,im
23     DO j = 1,im
24        asm( j ) = e( i , im-j+1 )
25  END DO
26     DO j = 1,im
27        e( i,j ) = asm( j )
28  END DO
29  END DO
[524]30
[5105]31  RETURN
32END SUBROUTINE eigen
Note: See TracBrowser for help on using the repository browser.