Compare commits
No commits in common. "4c13892c9d08b47c9f08963e206e09f44166cafc" and "f95dc7ed2a442eae578d3a736629529e86b9fa85" have entirely different histories.
4c13892c9d
...
f95dc7ed2a
@ -6,9 +6,8 @@ all: genbloubs movebloubs exportbloubs mergebloubs \
|
|||||||
|
|
||||||
# ------------------------------------------------------------
|
# ------------------------------------------------------------
|
||||||
|
|
||||||
GFOPT = -Wall -Wextra -g -time -I../Modules
|
GFOPT = -Wall -Wextra -g -time
|
||||||
OBJS = bloubspace.o povstuff.o mathstuff.o
|
OBJS = bloubspace.o povstuff.o mathstuff.o
|
||||||
MYLIB = '../Modules/libtth90modules.a'
|
|
||||||
|
|
||||||
# ------------------------------------------------------------
|
# ------------------------------------------------------------
|
||||||
|
|
||||||
@ -43,7 +42,7 @@ mathstuff.o: mathstuff.f90 Makefile
|
|||||||
# ------------------------------------------------------------
|
# ------------------------------------------------------------
|
||||||
|
|
||||||
genbloubs: genbloubs.f90 Makefile $(OBJS)
|
genbloubs: genbloubs.f90 Makefile $(OBJS)
|
||||||
gfortran $(GFOPT) $< $(OBJS) $(MYLIB) -o $@
|
gfortran $(GFOPT) $< $(OBJS) -o $@
|
||||||
|
|
||||||
movebloubs: movebloubs.f90 Makefile $(OBJS)
|
movebloubs: movebloubs.f90 Makefile $(OBJS)
|
||||||
gfortran $(GFOPT) $< $(OBJS) -o $@
|
gfortran $(GFOPT) $< $(OBJS) -o $@
|
||||||
|
@ -1,7 +1,7 @@
|
|||||||
program genbloubs
|
program genbloubs
|
||||||
|
|
||||||
use bloubspace
|
use bloubspace
|
||||||
use mathstuff2
|
use mathstuff
|
||||||
|
|
||||||
integer :: nbbloubs
|
integer :: nbbloubs
|
||||||
integer :: i
|
integer :: i
|
||||||
|
@ -3,15 +3,17 @@
|
|||||||
!-
|
!-
|
||||||
module trials
|
module trials
|
||||||
|
|
||||||
use pixrgb
|
|
||||||
|
|
||||||
implicit none
|
implicit none
|
||||||
|
|
||||||
contains
|
!-----------------------------------------------------------------------
|
||||||
!-------------------------------------------------------------------
|
!-------------------------------------------------------------------
|
||||||
! please write the same thing for RGB 16bits pictures !
|
|
||||||
|
|
||||||
subroutine new_spit_gray(pic, fname)
|
contains
|
||||||
|
!-----------------------------------------------------------------------
|
||||||
|
!-
|
||||||
|
|
||||||
|
!-------------------------------------------------------------------
|
||||||
|
subroutine new_spit_a(pic, fname)
|
||||||
|
|
||||||
integer, intent(in), dimension (:,:) :: pic
|
integer, intent(in), dimension (:,:) :: pic
|
||||||
character (len=*), intent(in) :: fname
|
character (len=*), intent(in) :: fname
|
||||||
@ -25,7 +27,7 @@ subroutine new_spit_gray(pic, fname)
|
|||||||
|
|
||||||
open(newunit=io, file=fname)
|
open(newunit=io, file=fname)
|
||||||
write (io, '(a2)') "P2"
|
write (io, '(a2)') "P2"
|
||||||
write (io, '("# new_spit_gray")')
|
write (io, '("# new_spit_a")')
|
||||||
write (io, '(i0," ",i0)') size(pic, 1), size(pic, 2)
|
write (io, '(i0," ",i0)') size(pic, 1), size(pic, 2)
|
||||||
write (io, '(i0)') 65535
|
write (io, '(i0)') 65535
|
||||||
|
|
||||||
@ -47,49 +49,6 @@ subroutine new_spit_gray(pic, fname)
|
|||||||
|
|
||||||
close(io)
|
close(io)
|
||||||
|
|
||||||
end subroutine
|
|
||||||
!-------------------------------------------------------------------
|
|
||||||
!-
|
|
||||||
! CAUTION: there was NO out-of-bounds check !
|
|
||||||
!-
|
|
||||||
subroutine new_spit_rgb16(pic, fname)
|
|
||||||
|
|
||||||
type(t_pixrgb), intent(in) :: pic(:,:)
|
|
||||||
character (len=*), intent(in) :: fname
|
|
||||||
|
|
||||||
integer :: io, ix, iy, ik
|
|
||||||
integer :: buffer(3*4), ptr
|
|
||||||
|
|
||||||
write(0, *) ">>> subroutine rgbpix_spit_as_pnm_16"
|
|
||||||
|
|
||||||
open(newunit=io, file=fname)
|
|
||||||
write (io, '(a2)') "P3"
|
|
||||||
! write (io, '("# rgbpix_spit_as_pnm_16")')
|
|
||||||
write (io, '(i0," ",i0)') size(pic, 1), size(pic, 2)
|
|
||||||
write (io, '(i0)') 65535
|
|
||||||
|
|
||||||
buffer = 0
|
|
||||||
ptr = 1
|
|
||||||
|
|
||||||
do iy=1, ubound(pic, 2)
|
|
||||||
do ix=1, ubound(pic, 1)
|
|
||||||
|
|
||||||
buffer(ptr) = pic(ix, iy)%r
|
|
||||||
buffer(ptr+1) = pic(ix, iy)%g
|
|
||||||
buffer(ptr+2) = pic(ix, iy)%b
|
|
||||||
ptr = ptr + 3
|
|
||||||
|
|
||||||
if (ptr .EQ. 13) then
|
|
||||||
write(io, "(12(' ', i0))") buffer
|
|
||||||
ptr = 1
|
|
||||||
endif
|
|
||||||
enddo ! write(io, *) " fin iy=", iy
|
|
||||||
enddo
|
|
||||||
|
|
||||||
! may be we have to flush the buffer ?
|
|
||||||
|
|
||||||
close(unit=io)
|
|
||||||
|
|
||||||
end subroutine
|
end subroutine
|
||||||
!-------------------------------------------------------------------
|
!-------------------------------------------------------------------
|
||||||
|
|
||||||
|
Loading…
Reference in New Issue
Block a user