Skip to content

Commit

Permalink
Merge pull request #71 from OpenSEMBA/reduce-compilation-flags
Browse files Browse the repository at this point in the history
Reduce compilation flags
  • Loading branch information
lmdiazangulo authored Nov 11, 2024
2 parents c545cb2 + 5592652 commit 918b185
Show file tree
Hide file tree
Showing 18 changed files with 44 additions and 456 deletions.
8 changes: 0 additions & 8 deletions CMakeLists.txt
Original file line number Diff line number Diff line change
Expand Up @@ -142,14 +142,6 @@ add_definitions(
-DCompileWithInt2
-DCompileWithReal4
-DCompileWithOpenMP
-DCompileWithAnisotropic
-DCompileWithEDispersives
-DCompileWithNF2FF
-DCompileWithNodalSources
-DCompileWithDMMA
-DCompileWithSGBC
-DCompileWithWires
-DCompileWithXDMF
)


5 changes: 0 additions & 5 deletions src_main_pub/anisotropic.F90
Original file line number Diff line number Diff line change
Expand Up @@ -32,9 +32,6 @@
!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!

module Anisotropic

#ifdef CompileWithAnisotropic

use fdetypes
implicit none
private
Expand Down Expand Up @@ -1581,6 +1578,4 @@ Subroutine CalculateCoeff(epr,mur,sigma,sigmam,dt,coeff)

end subroutine

#endif

end module Anisotropic
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
3 changes: 0 additions & 3 deletions src_main_pub/electricdispersive.F90
Original file line number Diff line number Diff line change
Expand Up @@ -33,7 +33,6 @@

module EDispersives

#ifdef CompileWithEDispersives

use fdetypes
USE REPORT
Expand Down Expand Up @@ -442,6 +441,4 @@ subroutine DestroyEDispersives(sgg)

end subroutine

#endif

end module EDispersives
83 changes: 0 additions & 83 deletions src_main_pub/errorreport.F90
Original file line number Diff line number Diff line change
Expand Up @@ -25,9 +25,7 @@
Module Report
use FDETYPES

#ifdef CompileWithXDMF
use snapxdmf
#endif

implicit none
private
Expand Down Expand Up @@ -299,32 +297,7 @@ subroutine ReportExistence(sgg,layoutnumber,size,thereare,mur_second,MurAfterPML

call print11(layoutnumber,SEPARADOR//sEPARADOR//SEPARADOR)
!!!
if ((thereare%NodalE).or.(thereare%NodalH)) then
#ifdef CompileWithNodalSources
continue
#else
buff=trim(adjustl(whoami))//' Nodal sources unsupported. Recompile'
call stoponerror(layoutnumber,size,buff)
#endif
endif
!
IF (thereare%FarFields) then
#ifdef CompileWithNF2FF
continue
#else
buff=trim(adjustl(whoami))//' NF2FF unsupported. Recompile'
call stoponerror(layoutnumber,size,buff)
#endif
endif
!
IF (thereare%SGBCs) then
#ifdef CompileWithSGBC
continue
#else
buff=trim(adjustl(whoami))//' SGBC unsupported. Recompile'
call stoponerror(layoutnumber,size,buff)
#endif
endif
IF ((thereare%Multiports).or.(thereare%AnisMultiports)) then
#ifdef CompileWithNIBC
continue
Expand All @@ -333,52 +306,6 @@ subroutine ReportExistence(sgg,layoutnumber,size,thereare,mur_second,MurAfterPML
call stoponerror(layoutnumber,size,buff)
#endif
endif
!
!
IF (thereare%Anisotropic) then
#ifdef CompileWithAnisotropic
continue
#else
buff=trim(adjustl(whoami))//' Anisotropic unsupported. Recompile'
call stoponerror(layoutnumber,size,buff)
#endif
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
#else
buff=trim(adjustl(whoami))//' Dispersive materials unsupported. Recompile'
call stoponerror(layoutnumber,size,buff)
#endif
endif
!
If (thereare%Wires) then
#ifdef CompileWithWires
continue
#else
#ifdef CompileWithBerengerWires
continue
#else
#ifdef CompileWithSlantedWires
continue
#else
buff=trim(adjustl(whoami))//' WIREs unsupported. Recompile'
call stoponerror(layoutnumber,size,buff)
#endif
#endif
#endif
endif
!
!!!!!!!!!!!!!
if (thereAre%MagneticMedia) then
buff=' has special H-media'
Expand Down Expand Up @@ -416,20 +343,15 @@ subroutine ReportExistence(sgg,layoutnumber,size,thereare,mur_second,MurAfterPML
buff= ' has Thin metal Materials'
call warnerrreport(buff)
endif
#ifdef CompileWithAnisotropic
IF ((thereare%Anisotropic).and.(.not.thereare%ThinSlot)) then
buff= ' has pure anisotropic media'
call warnerrreport(buff)
endif
#ifdef CompileWithDMMA
IF (thereare%ThinSlot) then
buff= ' has Thin Slots'
call warnerrreport(buff)
endif
#endif
#endif
!
#ifdef CompileWithEDispersives
IF (thereare%EDispersives) then
buff= ' has electric dispersives'
call warnerrreport(buff)
Expand All @@ -438,13 +360,10 @@ subroutine ReportExistence(sgg,layoutnumber,size,thereare,mur_second,MurAfterPML
buff= ' has magnetic dispersives'
call warnerrreport(buff)
endif
#endif
#ifdef CompileWithWires
If (thereare%Wires) then
buff= ' has Holland WIREs'
call warnerrreport(buff)
endif
#endif
#ifdef CompileWithBerengerWires
If (thereare%Wires) then
buff= ' has Multi-WIREs'
Expand Down Expand Up @@ -1168,7 +1087,6 @@ subroutine Timing(sgg, b, n, n_info, layoutnumber, size, maxCPUtime,flushseconds
call MPI_Barrier(MPI_COMM_WORLD,ierr)
#endif

#ifdef CompileWithXDMF
if ((mustsnap.and.(lmaxval (layoutnumber+1)> snapLevel)).or.(countersnap > 0)) then
countersnap=countersnap + 1
!
Expand Down Expand Up @@ -1272,7 +1190,6 @@ subroutine Timing(sgg, b, n, n_info, layoutnumber, size, maxCPUtime,flushseconds
countersnap=0
endif
endif
#endif

#ifdef CompileWithMPI
call MPI_Barrier(MPI_COMM_WORLD,ierr) !TODOS STOCH O NO 060619
Expand Down
4 changes: 0 additions & 4 deletions src_main_pub/farfield.F90
Original file line number Diff line number Diff line change
Expand Up @@ -29,9 +29,6 @@
!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!

module farfield_m

#ifdef CompileWithNF2FF

use fdetypes
USE REPORT

Expand Down Expand Up @@ -3576,5 +3573,4 @@ function average (pasadas,z1,z2) result (z)
RETURN
END FUNCTION

#endif
END MODULE farfield_m
Loading

0 comments on commit 918b185

Please sign in to comment.