Fortraneries/Modules/chkpixels.f90

37 lines
739 B
Fortran

program chkpixels
use spitpgm
implicit none
write(0, *) "------ CHKPIXELS ------"
call test_alpha()
STOP 'BECAUSE NO CPU AVAILABLE'
contains
!-------------------------------------------------------------------
!-
subroutine test_alpha()
integer, parameter :: SZ = 32
integer, dimension(SZ, SZ) :: greymap
integer :: ix, iy, value
value = 0
do iy=1, SZ
do ix=1, SZ
greymap(ix, iy) = value
value = value + 1
enddo
enddo
call spit_as_pgm_16 (greymap, 'a.pgm')
call spit_as_pgm_eq (greymap, 'b.pgm')
call spit_as_pgm_8 (greymap, 'c.pgm')
end subroutine
end program
!-------------------------------------------------------------------