69 lines
1.8 KiB
Fortran
69 lines
1.8 KiB
Fortran
program evolvopick
|
|
|
|
use spitpgm
|
|
use points3d
|
|
use fraktals
|
|
|
|
!-----------------------------------------------------
|
|
|
|
implicit none
|
|
|
|
double precision, dimension(4) :: KA, KB, KI
|
|
integer :: tick, nbsteps
|
|
double precision :: dptick
|
|
type(t_point3d), dimension(:), allocatable :: points
|
|
integer :: nbpoints
|
|
integer :: errcode
|
|
character (len=200) :: command
|
|
|
|
KA(1) = 2.24 ; KA(2) = 0.43
|
|
KA(3) = -0.65 ; KA(4) = -2.43
|
|
KB(1) = 1.11 ; KB(2) = 0.22
|
|
KB(3) = 1.65 ; KB(4) = -1.43
|
|
|
|
nbsteps = 1199
|
|
nbpoints = 26000
|
|
allocate(points(nbpoints), stat=errcode)
|
|
if (0 .NE. errcode) then
|
|
STOP " : EVOLVOPICK, NO ENOUGH MEMORY"
|
|
endif
|
|
|
|
do tick = 0, nbsteps
|
|
|
|
dptick = DBLE(tick) / DBLE(nbsteps)
|
|
! print *, tick, " ", dptick
|
|
call interp4dp(KA, KB, KI, dptick)
|
|
! print *, KI(1), KI(2), KI(3), KI(4)
|
|
write(0, '(1X, I8, 3X, 4F12.6)') tick, KI
|
|
|
|
call compute_pickover(points, KI)
|
|
call write_points3d(points, 7, 25990, 'WS/pick.dat')
|
|
|
|
write(command, '(A, I6)') './tracepick.sh ', tick
|
|
call execute_command_line (command, exitstat=errcode)
|
|
if (0 .NE. errcode) then
|
|
STOP ' : ERR RUN COMMAND !'
|
|
endif
|
|
|
|
enddo
|
|
|
|
!-----------------------------------------------------
|
|
|
|
contains
|
|
|
|
subroutine interp4dp (ina, inb, out, dpk)
|
|
double precision, dimension(4), intent(in) :: ina, inb
|
|
double precision, dimension(4), intent(out) :: out
|
|
double precision, intent(in) :: dpk
|
|
integer :: foo
|
|
|
|
do foo=1, 4
|
|
out(foo) = (ina(foo) * (1.0-dpk)) + (inb(foo) * (dpk))
|
|
enddo
|
|
|
|
end subroutine
|
|
|
|
|
|
|
|
end program evolvopick
|