Skip to content
wr_native.F90 1.3 KiB
Newer Older
Fabio Roberto Vitello's avatar
Fabio Roberto Vitello committed
!-----------------------------------------------------------------------
!
!
                        SUBROUTINE wr_native(n)
!
!
!-----------------------------------------------------------------------
!
!
!     Subroutine to output information about the system state to
!     the log and body data files.
!
!
!-----------------------------------------------------------------------

	 USE fly_h 
	implicit none

!   Declaration of local variables.
!   -------------------------------
        
	INTEGER(KIND=8) ::n
        INTEGER :: fo,na1
!-----------------------------------------------------------------------
	  
	  IF(me.eq.0) THEN
              WRITE(uterm,*)'Computed DTIME: ',dtime
              WRITE(uterm,*)'Step completed: ',n
	      call flush(uterm)
	  ENDIF
 	  na1=n

          if(chk_file.lt.0) chk_file=1000000

          fo=MOD(na1,chk_file)    
      IF(n.eq.nsteps .or. fo.eq.0 .or. halt_sim.gt.0) THEN
	

	
	IF(inasc.eq.'A') THEN
	
	
	    IF(me.eq.0) THEN
	      write(uterm,*)'ASCII DATA OUTPUT'
	      call flush(uterm)
	    ENDIF
	
            CALL write_b_asc
	    
        ENDIF
	
	IF(inasc.eq.'B') THEN
	
	
	    IF(me.eq.0) THEN
	      write(uterm,*)'BINARY DATA OUTPUT'
	      call flush(uterm)
	    ENDIF
	
            CALL write_b_bin 
        
	ENDIF
      
      ENDIF
	   
        RETURN
        END