Fortran Coder

查看: 5324|回复: 1

[Module] 封了个module

[复制链接]

13

帖子

9

主题

0

精华

入门

F 币
75 元
贡献
52 点
发表于 2016-2-29 19:58:44 | 显示全部楼层 |阅读模式
本帖最后由 zhangzhipeng 于 2016-2-29 22:12 编辑

FileNumber和StationNumber计算出来了,但是后面为什么崩?
[Fortran] 纯文本查看 复制代码
Module SACParameter
Implicit None
    Integer, parameter :: FileUnit = 100
    Character( Len = * ), Parameter :: Directer = '"'//'..\WAV\WAVFormYiliang\yiliang\*.*'//'"'
    Integer( kind = 4), save :: i, j, k, m, n, FileNameLong
    Character( Len = 1 ), save :: separator 
    Character( Len = 4 ), save :: Station 
    Integer( kind = 4 ), save :: StationNumber
    Integer( kind = 4 ), save :: FileNumber
    Type :: EventPara
        Character( Len = 4 ), dimension(:), allocatable :: StationName        ! 台站名数组   
        Character( Len = 4 ), dimension(:,:), allocatable :: ComponentName    ! 三分量文件名(台站,分量)
        Character( Len = 1 ), dimension(:,:), allocatable :: stringFileName   ! 文件名信息数组二维字符数组
        Real(kind = 4), dimension(:,:), allocatable :: StationWaveformLong    ! 重采样后的波形长度(台站,分量)
        Real(kind = 4), dimension(:,:), allocatable :: StationMaximumAmplitude! 归一化后的最大振幅(台站,分量) 
        Real(kind = 4), dimension(:,:), allocatable :: StationDELTA           ! 重采样采样间隔(台站,分量)
    End Type EventPara
    Type :: SACHeader
        Real( Kind = 4 ), Allocatable :: DELTA(:,:), DEPMIN(:,:), DEPMAX(:,:), SCALE(:,:), ODELTA(:,:), B(:,:), E(:,:),                                                                    &
                             O(:,:), A(:,:), INTERNAL1(:,:), T0(:,:), T1(:,:), T2(:,:), T3(:,:), T4(:,:), T5(:,:), T6(:,:), T7(:,:), T8(:,:), T9(:,:), F(:,:),                             &
                             RESP0(:,:),RESP1(:,:),RESP2(:,:),RESP3(:,:),RESP4(:,:),RESP5(:,:),RESP6(:,:),RESP7(:,:),RESP8(:,:),RESP9(:,:),                                                &
                             STLA(:,:),STLO(:,:),STEL(:,:),STDP(:,:),EVLA(:,:),EVLO(:,:),EVEL(:,:),EVDP(:,:),MAG(:,:),                                                                     &
                             USER0(:,:), USER1(:,:), USER2(:,:), USER3(:,:), USER4(:,:), USER5(:,:), USER6(:,:), USER7(:,:), USER8(:,:), USER9(:,:),                                       &
                             DIST(:,:), AZ(:,:), BAZ(:,:), GCARC(:,:), INTERNAL2(:,:), INTERNAL3(:,:),                                                                                     &
                             DEPMEN(:,:), CMPAZ(:,:), CMPINC(:,:), XMINIMUM(:,:), XMAXIMUM(:,:), YMINIMUM(:,:), YMAXIMUM(:,:),                                                             &
                             ADJTM(:,:), UNUSED1(:,:), UNUSED2(:,:), UNUSED3(:,:), UNUSED4(:,:), UNUSED5(:,:), UNUSED6(:,:)
        Integer( Kind = 4 ), Allocatable :: NZYEAR(:,:), NZJDAY(:,:), NZHOUR(:,:), NZMIN(:,:), NZSEC(:,:), NZMSEC(:,:), NVHDR(:,:),                                                        &
                             NORID(:,:), NEVID(:,:), NPTS(:,:), NSPTS(:,:), NWFID(:,:), NXSIZE(:,:), NYSIZE(:,:), UNUSED7(:,:),                                                            &
                             IFTYPE(:,:), IDEP(:,:), IZTYPE(:,:), UNUSED8(:,:), IINST(:,:), ISTREG(:,:), IEVREG(:,:), IEVTYP(:,:), IQUAL(:,:), ISYNTH(:,:), IMAGTYP(:,:), IMAGSRC(:,:),    &
                             UNUSED9(:,:), UNUSED10(:,:), UNUSED11(:,:), UNUSED12(:,:), UNUSED13(:,:), UNUSED14(:,:), UNUSED15(:,:), UNUSED16(:,:),                                        &
                             LEVEN(:,:), LPSPOL(:,:), LOVROK(:,:), LCALDA(:,:), UNUSED17(:,:)
        Character( Len = 16 ), Allocatable :: KEVNM(:,:)
        Character( Len = 8 ), Allocatable :: KSTNM(:,:), KHOLE(:,:), KO(:,:), KA(:,:), KT0(:,:), KT1(:,:), KT2(:,:), KT3(:,:), KT4(:,:), KT5(:,:), KT6(:,:), KT7(:,:), KT8(:,:), KT9(:,:), &
                             KF(:,:), KUSER0(:,:), KUSER1(:,:), KUSER2(:,:), KCMPNM(:,:), KNETWK(:,:),  KWaveformRD(:,:), KINST(:,:)
        
        Integer(kind = 4), dimension(:,:), Allocatable :: Header1    ! 头端一(台站,分量)
        Real(kind = 4), dimension(:,:), Allocatable :: Header2       ! 头端二(台站,分量)
        Character(Len = 8), dimension(:,:), Allocatable :: Header3   ! 头端三(台站,分量)
        real( kind = 4 ), Allocatable :: Waveform(:,:,:)             ! 波形(台站,分量,记录)
        Integer(kind = 4), Allocatable :: WaveformLong(:,:)          ! 波形长度(台站,分量)
    End Type SACHeader 
public FileUnit, Directer, i, j, k, m, n, FileNameLong, separator, Station, DoWithWildcard, WriteName, SplitName, EventPara, SACHeader  
!------------------------------------------------------------------------------------------
Contains
Subroutine DoWithWildcard(cWildcard,CallBack,iTotal)
  Use DFLib,only:GetFileInfoQQ,GetLastErrorQQ,FILE$INFO,FILE$LAST,FILE$ERROR,FILE$FIRST,ERR$NOMEM,ERR$NOENT,FILE$DIR
    type(EventPara) :: EVENT1
    type(SACHeader) :: SACFILE1
  Interface 
    Subroutine CallBack( FileName , loop )
      Character(*),Intent(In) :: FileName
      Integer,Intent(In) :: loop
    End Subroutine CallBack
  End Interface
  Character*(*),Intent(In)::cWildcard
  Integer,Intent(Out)::iTotal
  TYPE (FILE$INFO) info
  INTEGER(4)::Wildhandle,length,retInt
  Wildhandle = FILE$FIRST
  iTotal = 0
  DO WHILE (.TRUE.)
      length = GetFileInfoQQ(cWildCard,info,Wildhandle)
      IF ((Wildhandle .EQ. FILE$LAST) .OR.(Wildhandle .EQ. FILE$ERROR)) THEN
        SELECT CASE (GetLastErrorQQ())
        CASE (ERR$NOMEM)  !//内存不足
          iTotal = - 1
          Return
        CASE (ERR$NOENT)  !//碰到通配符序列尾
          Return
        CASE DEFAULT
          iTotal = 0
          Return
        END SELECT
      END IF
      If ((info%permit.AND.FILE$DIR).Eq.0) then
        Call CallBack( Trim(info.Name) , iTotal + 1 )
        iTotal = iTotal + 1
      End If
  END DO
End Subroutine DoWithWildcard
    
Subroutine WriteName( FileName , loop )
    type(EventPara) :: EVENT1
    type(SACHeader) :: SACFILE1
  Character( Len = *),Intent(In) :: FileName
  Integer,Intent(In) :: loop
  i = Index( FileName, separator )
  If( Station /= FileName(1:i - 1)) then
      Station = FileName(1:i - 1)
      j = j + 1
  End if
  Write(*,*) loop, Station, FileName, j
  StationNumber = j
  FileNumber = loop
End Subroutine WriteName
    
Subroutine SplitName( FileName , loop )                                          
    type(EventPara) :: EVENT1                   
    type(SACHeader) :: SACFILE1                   
  Character(*),Intent(In) :: FileName            
  Integer,Intent(In) :: loop                     
  FileNameLong = len_trim(FileName)
  i = Index( FileName, separator )
  j = Index( FileName, separator, .True. )
  If( Station /= FileName(1:j - 1)) then
      n = n + 1
      m = 1
      Station = FileName(1:i - 1)
      pause 1
      EVENT1%StationName(n) = Station
      pause 2
      EVENT1%ComponentName(n,m) = FileName( j + 1:FileNameLong)
  Else
      EVENT1%ComponentName(n,m) = FileName( j + 1:FileNameLong)
      m = m + 1
  End if
End Subroutine SplitName
End module SACParameter
!*************************************************************************    
Program Main
USE SACParameter
  Implicit None
    type(EventPara) :: EVENT1
    type(SACHeader) :: SACFILE1
!  External WriteName, SplitName
  
  !Character( Len = * ), Intent( In ) :: DirecterPath
  i = 0
  j = 0
  separator = "."
  Station = "AAA"
  !Character( Len = * ), Parameter :: Path = '"'//'DirecterPath'//'"'
  Call DoWithWildcard( '..\WAV\WAVFormYiliang\yiliang\*.*' , WriteName , N)
  If ( N >= 0 ) then
    Write(*,*) '共' , FileNumber , '个文件,',StationNumber,'个台站'
  End If
  
  Allocate(EVENT1%StationName(StationNumber))        ! 台站名数组   
  Allocate(EVENT1%ComponentName(StationNumber,3))    ! 三分量文件名(台站,分量)
  Allocate(EVENT1%stringFileName(StationNumber,3))   ! 文件名信息数组二维字符数组
  !Allocate(StationWaveformLong(:,:))                       ! 重采样后的波形长度(台站,分量)
  !Allocate(StationMaximumAmplitude(:,:))                   ! 归一化后的最大振幅(台站,分量) 
  Allocate(EVENT1%StationDELTA(StationNumber,3))     ! 重采样采样间隔(台站,分量)
  
  Allocate(SACFILE1%Header1(StationNumber,3))        ! 头端一(台站,分量)
  Allocate(SACFILE1%Header2(StationNumber,3))        ! 头端二(台站,分量)
  Allocate(SACFILE1%Header3(StationNumber,3))        ! 头端三(台站,分量)
  !Allocatable(Waveform(:,:,:))                             ! 波形(台站,分量,记录)
  Allocate(SACFILE1%WaveformLong(StationNumber,3))   ! 波形长度(台站,分量)
  i = 0
  j = 0
  m = 0
  n = 0
  separator = "."
  Station = "AAA"
  Call DoWithWildcard( '..\WAV\WAVFormYiliang\yiliang\*.*' , SplitName , n )
  Do i = 1, StationNumber
    Write(*,*) EVENT1%StationName(i)
    Do j = 1, FileNumber
        Write(*,*) EVENT1%ComponentName(i,j)
    End do
  End do
End Program Main


2

帖子

0

主题

0

精华

入门

弱智

F 币
95 元
贡献
33 点

规矩勋章

发表于 2016-3-18 18:03:05 | 显示全部楼层
                                                   
您需要登录后才可以回帖 登录 | 极速注册

本版积分规则

捐赠本站|Archiver|关于我们 About Us|小黑屋|Fcode ( 京ICP备18005632-2号 )

GMT+8, 2024-3-29 09:38

Powered by Tencent X3.4

© 2013-2024 Tencent

快速回复 返回顶部 返回列表