Skip to content

Commit

Permalink
Removes CompileWithDMMA flag
Browse files Browse the repository at this point in the history
  • Loading branch information
lmdiazangulo committed Nov 9, 2024
1 parent d2e6fb6 commit 9aaf4d2
Show file tree
Hide file tree
Showing 6 changed files with 3 additions and 48 deletions.
1 change: 0 additions & 1 deletion CMakeLists.txt
Original file line number Diff line number Diff line change
Expand Up @@ -143,7 +143,6 @@ add_definitions(
-DCompileWithReal4
-DCompileWithOpenMP
-DCompileWithEDispersives
-DCompileWithDMMA
-DCompileWithWires
)

Expand Down
6 changes: 0 additions & 6 deletions src_main_pub/dmma_thin_slot.F90
Original file line number Diff line number Diff line change
Expand Up @@ -23,10 +23,6 @@
!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!

MODULE DMMA


#ifdef CompileWithDMMA

USE FDETYPES
IMPLICIT NONE
PRIVATE
Expand Down Expand Up @@ -162,6 +158,4 @@ END SUBROUTINE dmma_thin_Slot
!
!

#endif

END MODULE
11 changes: 0 additions & 11 deletions src_main_pub/errorreport.F90
Original file line number Diff line number Diff line change
Expand Up @@ -308,15 +308,6 @@ subroutine ReportExistence(sgg,layoutnumber,size,thereare,mur_second,MurAfterPML
endif
!
!
IF (thereare%ThinSlot) then
#ifdef CompileWithDMMA
continue
#else
buff=trim(adjustl(whoami))//' Thin slots unsupported. Recompile'
call stoponerror(layoutnumber,size,buff)
#endif
endif
!
IF (thereare%EDispersives.or.thereare%MDispersives) then
#ifdef CompileWithEDispersives
continue
Expand Down Expand Up @@ -384,12 +375,10 @@ subroutine ReportExistence(sgg,layoutnumber,size,thereare,mur_second,MurAfterPML
buff= ' has pure anisotropic media'
call warnerrreport(buff)
endif
#ifdef CompileWithDMMA
IF (thereare%ThinSlot) then
buff= ' has Thin Slots'
call warnerrreport(buff)
endif
#endif
!
#ifdef CompileWithEDispersives
IF (thereare%EDispersives) then
Expand Down
14 changes: 1 addition & 13 deletions src_main_pub/interpreta_switches.F90
Original file line number Diff line number Diff line change
Expand Up @@ -454,13 +454,12 @@ subroutine interpreta(l,statuse)
END IF
l%opcionespararesumeo = trim (adjustl(l%opcionespararesumeo)) // ' ' // trim (adjustl(l%chain)) // ' ' // trim (adjustl(f))
!
#ifdef CompileWithDMMA
CASE ('-dmma')
l%run_with_dmma = .TRUE.
l%run_with_abrezanjas = .FALSE.
l%opcionespararesumeo = trim (adjustl(l%opcionespararesumeo)) // ' ' // trim (adjustl(l%chain))
!! i = i + 1;
#endif

#ifdef CompileWithConformal
CASE ('-abrezanjas') !Provisional FEB-2018

Expand Down Expand Up @@ -1622,9 +1621,7 @@ subroutine print_help(l)
CALL print11 (l%layoutnumber, '-conf file : conformal file ')
CALL print11 (l%layoutnumber, '-abrezanjas : Thin-gaps treated in conformal manner ')
#endif
#ifdef CompileWithDMMA
CALL print11 (l%layoutnumber, '-dmma : Thin-gaps treated in DMMA manner ')
#endif
#ifdef CompileWithMPI
CALL print11 (l%layoutnumber, '-mpidir {x,y,z} : Rotate model to force MPI along z be the largest ')
CALL print11 (l%layoutnumber, '-force cutplane : Force a MPI layout to begin at cutplane (debug!) ')
Expand Down Expand Up @@ -1688,11 +1685,7 @@ subroutine print_help(l)
#endif
CALL print11 (l%layoutnumber, 'SUPPORTED: Near-to-Far field probes')
CALL print11 (l%layoutnumber, 'SUPPORTED: Lossy anistropic materials, both electric and magnetic')
#ifdef CompileWithDMMA
CALL print11 (l%layoutnumber, 'SUPPORTED: Thin Slots ')
#else
!CALL print11 (l%layoutnumber, 'UNSUPPORTED: Thin Slots ')
#endif
#ifdef CompileWithEDispersives
CALL print11 (l%layoutnumber, 'SUPPORTED: Electric and Magnetic Dispersive materials ')
#else
Expand Down Expand Up @@ -2173,12 +2166,7 @@ subroutine default_flags(l)
l%relaunching=.false.
l%forcestop=.false.
l%input_conformal_flag = .false.
!thin gaps
#ifdef CompileWithDMMA
l%run_with_dmma = .true.
#else
l%run_with_dmma = .false.
#endif
#ifdef CompileWithConformal
l%run_with_dmma = .false.
! todo esto para el abrezanjas. se precisa tambien el l%input_conformal_flag
Expand Down
12 changes: 2 additions & 10 deletions src_main_pub/preprocess_geom.F90
Original file line number Diff line number Diff line change
Expand Up @@ -38,9 +38,7 @@ MODULE Preprocess_m
USE CreateMatrices
!typos que leo desde mi FDE
USE FDEtypes
#ifdef CompileWithDMMA
USE DMMA
#endif
#ifdef CompileWithConformal
USE CONFORMAL_INI_CLASS
USE CONFORMAL_TOOLS
Expand Down Expand Up @@ -113,14 +111,12 @@ SUBROUTINE read_geomData (sgg,sggMtag,sggMiNo,sggMiEx,sggMiEy,sggMiEz,sggMiHx,sg
character (LEN=BUFSIZE) :: chari,charj,chark,chari2,charj2,chark2
!
logical :: paraerrhilo,groundwires,islossy,DENTRO
#ifdef CompileWithDMMA
REAL (KIND=RKIND) :: width, dir (1:3), epr1, mur1
LOGICAL :: oriX, oriY, oriZ, oriX2, oriY2, oriZ2, oriX3, oriY3, oriZ3, iguales
LOGICAL :: oriX4, oriY4, oriZ4
REAL (KIND=RKIND), DIMENSION (3, 3) :: EprSlot, MurSlot
INTEGER (KIND=4) :: indicemedio
INTEGER (KIND=4) :: i11, j11
#endif
!
type (tagtype_t) :: tagtype
TYPE (FreqDepenMaterial), POINTER :: fdgeom
Expand Down Expand Up @@ -195,13 +191,12 @@ SUBROUTINE read_geomData (sgg,sggMtag,sggMiNo,sggMiEx,sggMiEy,sggMiEz,sggMiHx,sg
!echo por demas, habria que precontar pero es complicado porque depende del procesamiento
!thin Slots

#ifdef CompileWithDMMA
if (run_with_dmma) then
DO j = 1, this%tSlots%n_tg
contamedia = contamedia + this%tSlots%Tg(j)%N_tgc
END DO
endif
#endif

!end thin Slots
!PARA LA CAPA EXTRA 2013
if (medioextra%exists) then
Expand Down Expand Up @@ -2567,9 +2562,6 @@ SUBROUTINE read_geomData (sgg,sggMtag,sggMiNo,sggMiEx,sggMiEy,sggMiEz,sggMiHx,sg
ENDIF
!FIN WIRES

!!?!?!?
!
#ifdef CompileWithDMMA
if (run_with_dmma) then
!always at the end since the orientation is found from the PEC one
!thin Slots
Expand Down Expand Up @@ -2834,7 +2826,7 @@ SUBROUTINE read_geomData (sgg,sggMtag,sggMiNo,sggMiEx,sggMiEy,sggMiEz,sggMiHx,sg
END DO
!
endif !del run_with_dmma
#endif

!debe ir al final para respetar el tipo de medio que haya SI SE TRATASE COMO A UN MEDIO
!nodalsource
!precounting
Expand Down
7 changes: 0 additions & 7 deletions src_main_pub/semba_fdtd.F90
Original file line number Diff line number Diff line change
Expand Up @@ -642,13 +642,6 @@ PROGRAM SEMBA_FDTD_launcher
IF (sgg%Med(i)%Is%MDispersive) THEN
#ifndef CompileWithEDispersives
CALL stoponerror (l%layoutnumber, l%size, 'Mdispersives without Edispersives support. Recompile!')
#endif
CONTINUE
END IF
!
IF (sgg%Med(i)%Is%ThinSlot) THEN
#ifndef CompileWithDMMA
CALL stoponerror (l%layoutnumber, l%size, 'Slots without Slots support. Recompile!')
#endif
CONTINUE
END IF
Expand Down

0 comments on commit 9aaf4d2

Please sign in to comment.