module BishBosh.Input.SearchOptions(
SearchDepth,
SortOnStandardOpeningMoveFrequency,
HammingDistance,
MaybeRetireAfterNMoves,
TrapRepeatedPositions,
MaybeUseTranspositions,
Reader,
SearchOptions(
getSortOnStandardOpeningMoveFrequency,
getMaybeCaptureMoveSortAlgorithm,
getMaybeMinimumHammingDistance,
getMaybeRetireKillerMovesAfter,
getTrapRepeatedPositions,
getUsePondering,
getMaybeUseTranspositions,
getStandardOpeningOptions,
getSearchDepthByLogicalColour
),
tag,
searchDepthTag,
minimumSearchDepth,
defaultSearchDepth,
mkSearchOptions,
getSearchDepth,
maybeRetireTranspositionsAfter,
maybeMinimumTranspositionSearchDepth,
setSearchDepth,
swapSearchDepth,
recordKillerMoves
) where
import BishBosh.Data.Bool()
import BishBosh.Data.Integral()
import Control.Arrow((***))
import qualified BishBosh.Attribute.CaptureMoveSortAlgorithm as Attribute.CaptureMoveSortAlgorithm
import qualified BishBosh.Attribute.LogicalColour as Attribute.LogicalColour
import qualified BishBosh.Component.Move as Component.Move
import qualified BishBosh.Data.Exception as Data.Exception
import qualified BishBosh.Data.Foldable
import qualified BishBosh.Input.StandardOpeningOptions as Input.StandardOpeningOptions
import qualified BishBosh.Property.Opposable as Property.Opposable
import qualified BishBosh.Text.Case as Text.Case
import qualified BishBosh.Text.ShowList as Text.ShowList
import qualified Control.DeepSeq
import qualified Control.Exception
import qualified Control.Monad.Reader
import qualified Data.Default
import qualified Data.Foldable
import qualified Data.Map.Strict
import qualified Data.Maybe
import qualified Text.XML.HXT.Arrow.Pickle as HXT
tag :: String
tag :: String
tag = String
"searchOptions"
sortOnStandardOpeningMoveFrequencyTag :: String
sortOnStandardOpeningMoveFrequencyTag :: String
sortOnStandardOpeningMoveFrequencyTag = String
"sortOnStandardOpeningMoveFrequency"
minimumHammingDistanceTag :: String
minimumHammingDistanceTag :: String
minimumHammingDistanceTag = String
"minimumHammingDistance"
retireKillerMovesAfterTag :: String
retireKillerMovesAfterTag :: String
retireKillerMovesAfterTag = String
"retireKillerMovesAfter"
trapRepeatedPositionsTag :: String
trapRepeatedPositionsTag :: String
trapRepeatedPositionsTag = String
"trapRepeatedPositions"
usePonderingTag :: String
usePonderingTag :: String
usePonderingTag = String
"usePondering"
retireTranspositionsAfterTag :: String
retireTranspositionsAfterTag :: String
retireTranspositionsAfterTag = String
"retireTranspositionsAfter"
minimumTranspositionSearchDepthTag :: String
minimumTranspositionSearchDepthTag :: String
minimumTranspositionSearchDepthTag = String
"minimumTranspositionSearchDepth"
searchDepthTag :: String
searchDepthTag :: String
searchDepthTag = String
"searchDepth"
searchDepthByLogicalColourTag :: String
searchDepthByLogicalColourTag :: String
searchDepthByLogicalColourTag = String -> ShowS
showString String
searchDepthTag ShowS -> ShowS -> ShowS
forall b c a. (b -> c) -> (a -> b) -> a -> c
. String -> ShowS
showString String
"By" ShowS -> ShowS
forall a b. (a -> b) -> a -> b
$ ShowS
Text.Case.toUpperInitial String
Attribute.LogicalColour.tag
type SearchDepth = Component.Move.NPlies
minimumSearchDepth :: SearchDepth
minimumSearchDepth :: SearchDepth
minimumSearchDepth = SearchDepth
1
defaultSearchDepth :: SearchDepth
defaultSearchDepth :: SearchDepth
defaultSearchDepth = SearchDepth
4
type SortOnStandardOpeningMoveFrequency = Bool
type HammingDistance = Int
type MaybeRetireAfterNMoves = Maybe Component.Move.NMoves
type TrapRepeatedPositions = Bool
type UsePondering = Bool
type MaybeUseTranspositions = Maybe (Component.Move.NMoves, SearchDepth)
type SearchDepthByLogicalColour = Data.Map.Strict.Map Attribute.LogicalColour.LogicalColour SearchDepth
data SearchOptions = MkSearchOptions {
SearchOptions -> SortOnStandardOpeningMoveFrequency
getSortOnStandardOpeningMoveFrequency :: SortOnStandardOpeningMoveFrequency,
SearchOptions -> Maybe CaptureMoveSortAlgorithm
getMaybeCaptureMoveSortAlgorithm :: Maybe Attribute.CaptureMoveSortAlgorithm.CaptureMoveSortAlgorithm,
SearchOptions -> Maybe SearchDepth
getMaybeMinimumHammingDistance :: Maybe HammingDistance,
SearchOptions -> Maybe SearchDepth
getMaybeRetireKillerMovesAfter :: MaybeRetireAfterNMoves,
SearchOptions -> SortOnStandardOpeningMoveFrequency
getTrapRepeatedPositions :: TrapRepeatedPositions,
SearchOptions -> SortOnStandardOpeningMoveFrequency
getUsePondering :: UsePondering,
SearchOptions -> MaybeUseTranspositions
getMaybeUseTranspositions :: MaybeUseTranspositions,
SearchOptions -> StandardOpeningOptions
getStandardOpeningOptions :: Input.StandardOpeningOptions.StandardOpeningOptions,
SearchOptions -> SearchDepthByLogicalColour
getSearchDepthByLogicalColour :: SearchDepthByLogicalColour
} deriving SearchOptions
-> SearchOptions -> SortOnStandardOpeningMoveFrequency
(SearchOptions
-> SearchOptions -> SortOnStandardOpeningMoveFrequency)
-> (SearchOptions
-> SearchOptions -> SortOnStandardOpeningMoveFrequency)
-> Eq SearchOptions
forall a.
(a -> a -> SortOnStandardOpeningMoveFrequency)
-> (a -> a -> SortOnStandardOpeningMoveFrequency) -> Eq a
/= :: SearchOptions
-> SearchOptions -> SortOnStandardOpeningMoveFrequency
$c/= :: SearchOptions
-> SearchOptions -> SortOnStandardOpeningMoveFrequency
== :: SearchOptions
-> SearchOptions -> SortOnStandardOpeningMoveFrequency
$c== :: SearchOptions
-> SearchOptions -> SortOnStandardOpeningMoveFrequency
Eq
instance Control.DeepSeq.NFData SearchOptions where
rnf :: SearchOptions -> ()
rnf MkSearchOptions {
getSortOnStandardOpeningMoveFrequency :: SearchOptions -> SortOnStandardOpeningMoveFrequency
getSortOnStandardOpeningMoveFrequency = SortOnStandardOpeningMoveFrequency
sortOnStandardOpeningMoveFrequency,
getMaybeCaptureMoveSortAlgorithm :: SearchOptions -> Maybe CaptureMoveSortAlgorithm
getMaybeCaptureMoveSortAlgorithm = Maybe CaptureMoveSortAlgorithm
maybeCaptureMoveSortAlgorithm,
getMaybeMinimumHammingDistance :: SearchOptions -> Maybe SearchDepth
getMaybeMinimumHammingDistance = Maybe SearchDepth
maybeMinimumHammingDistance,
getMaybeRetireKillerMovesAfter :: SearchOptions -> Maybe SearchDepth
getMaybeRetireKillerMovesAfter = Maybe SearchDepth
maybeRetireKillerMovesAfter,
getTrapRepeatedPositions :: SearchOptions -> SortOnStandardOpeningMoveFrequency
getTrapRepeatedPositions = SortOnStandardOpeningMoveFrequency
trapRepeatedPositions,
getUsePondering :: SearchOptions -> SortOnStandardOpeningMoveFrequency
getUsePondering = SortOnStandardOpeningMoveFrequency
usePondering,
getMaybeUseTranspositions :: SearchOptions -> MaybeUseTranspositions
getMaybeUseTranspositions = MaybeUseTranspositions
maybeUseTranspositions,
getStandardOpeningOptions :: SearchOptions -> StandardOpeningOptions
getStandardOpeningOptions = StandardOpeningOptions
standardOpeningOptions,
getSearchDepthByLogicalColour :: SearchOptions -> SearchDepthByLogicalColour
getSearchDepthByLogicalColour = SearchDepthByLogicalColour
searchDepthByLogicalColour
} = ((SortOnStandardOpeningMoveFrequency,
Maybe CaptureMoveSortAlgorithm, Maybe SearchDepth,
Maybe SearchDepth),
(SortOnStandardOpeningMoveFrequency,
SortOnStandardOpeningMoveFrequency, MaybeUseTranspositions,
StandardOpeningOptions, SearchDepthByLogicalColour))
-> ()
forall a. NFData a => a -> ()
Control.DeepSeq.rnf (
(
SortOnStandardOpeningMoveFrequency
sortOnStandardOpeningMoveFrequency, Maybe CaptureMoveSortAlgorithm
maybeCaptureMoveSortAlgorithm, Maybe SearchDepth
maybeMinimumHammingDistance, Maybe SearchDepth
maybeRetireKillerMovesAfter
), (
SortOnStandardOpeningMoveFrequency
trapRepeatedPositions, SortOnStandardOpeningMoveFrequency
usePondering, MaybeUseTranspositions
maybeUseTranspositions, StandardOpeningOptions
standardOpeningOptions, SearchDepthByLogicalColour
searchDepthByLogicalColour
)
)
instance Show SearchOptions where
showsPrec :: SearchDepth -> SearchOptions -> ShowS
showsPrec SearchDepth
_ MkSearchOptions {
getSortOnStandardOpeningMoveFrequency :: SearchOptions -> SortOnStandardOpeningMoveFrequency
getSortOnStandardOpeningMoveFrequency = SortOnStandardOpeningMoveFrequency
sortOnStandardOpeningMoveFrequency,
getMaybeCaptureMoveSortAlgorithm :: SearchOptions -> Maybe CaptureMoveSortAlgorithm
getMaybeCaptureMoveSortAlgorithm = Maybe CaptureMoveSortAlgorithm
maybeCaptureMoveSortAlgorithm,
getMaybeMinimumHammingDistance :: SearchOptions -> Maybe SearchDepth
getMaybeMinimumHammingDistance = Maybe SearchDepth
maybeMinimumHammingDistance,
getMaybeRetireKillerMovesAfter :: SearchOptions -> Maybe SearchDepth
getMaybeRetireKillerMovesAfter = Maybe SearchDepth
maybeRetireKillerMovesAfter,
getTrapRepeatedPositions :: SearchOptions -> SortOnStandardOpeningMoveFrequency
getTrapRepeatedPositions = SortOnStandardOpeningMoveFrequency
trapRepeatedPositions,
getUsePondering :: SearchOptions -> SortOnStandardOpeningMoveFrequency
getUsePondering = SortOnStandardOpeningMoveFrequency
usePondering,
getMaybeUseTranspositions :: SearchOptions -> MaybeUseTranspositions
getMaybeUseTranspositions = MaybeUseTranspositions
maybeUseTranspositions,
getStandardOpeningOptions :: SearchOptions -> StandardOpeningOptions
getStandardOpeningOptions = StandardOpeningOptions
standardOpeningOptions,
getSearchDepthByLogicalColour :: SearchOptions -> SearchDepthByLogicalColour
getSearchDepthByLogicalColour = SearchDepthByLogicalColour
searchDepthByLogicalColour
} = [(String, ShowS)] -> ShowS
Text.ShowList.showsAssociationList' ([(String, ShowS)] -> ShowS)
-> ([(String, ShowS)] -> [(String, ShowS)])
-> [(String, ShowS)]
-> ShowS
forall b c a. (b -> c) -> (a -> b) -> a -> c
. ([(String, ShowS)] -> [(String, ShowS)])
-> (CaptureMoveSortAlgorithm
-> [(String, ShowS)] -> [(String, ShowS)])
-> Maybe CaptureMoveSortAlgorithm
-> [(String, ShowS)]
-> [(String, ShowS)]
forall b a. b -> (a -> b) -> Maybe a -> b
Data.Maybe.maybe [(String, ShowS)] -> [(String, ShowS)]
forall a. a -> a
id (
(:) ((String, ShowS) -> [(String, ShowS)] -> [(String, ShowS)])
-> (CaptureMoveSortAlgorithm -> (String, ShowS))
-> CaptureMoveSortAlgorithm
-> [(String, ShowS)]
-> [(String, ShowS)]
forall b c a. (b -> c) -> (a -> b) -> a -> c
. (,) String
Attribute.CaptureMoveSortAlgorithm.tag (ShowS -> (String, ShowS))
-> (CaptureMoveSortAlgorithm -> ShowS)
-> CaptureMoveSortAlgorithm
-> (String, ShowS)
forall b c a. (b -> c) -> (a -> b) -> a -> c
. CaptureMoveSortAlgorithm -> ShowS
forall a. Show a => a -> ShowS
shows
) Maybe CaptureMoveSortAlgorithm
maybeCaptureMoveSortAlgorithm ([(String, ShowS)] -> [(String, ShowS)])
-> ([(String, ShowS)] -> [(String, ShowS)])
-> [(String, ShowS)]
-> [(String, ShowS)]
forall b c a. (b -> c) -> (a -> b) -> a -> c
. ([(String, ShowS)] -> [(String, ShowS)])
-> (SearchDepth -> [(String, ShowS)] -> [(String, ShowS)])
-> Maybe SearchDepth
-> [(String, ShowS)]
-> [(String, ShowS)]
forall b a. b -> (a -> b) -> Maybe a -> b
Data.Maybe.maybe [(String, ShowS)] -> [(String, ShowS)]
forall a. a -> a
id (
(:) ((String, ShowS) -> [(String, ShowS)] -> [(String, ShowS)])
-> (SearchDepth -> (String, ShowS))
-> SearchDepth
-> [(String, ShowS)]
-> [(String, ShowS)]
forall b c a. (b -> c) -> (a -> b) -> a -> c
. (,) String
minimumHammingDistanceTag (ShowS -> (String, ShowS))
-> (SearchDepth -> ShowS) -> SearchDepth -> (String, ShowS)
forall b c a. (b -> c) -> (a -> b) -> a -> c
. SearchDepth -> ShowS
forall a. Show a => a -> ShowS
shows
) Maybe SearchDepth
maybeMinimumHammingDistance ([(String, ShowS)] -> [(String, ShowS)])
-> ([(String, ShowS)] -> [(String, ShowS)])
-> [(String, ShowS)]
-> [(String, ShowS)]
forall b c a. (b -> c) -> (a -> b) -> a -> c
. ([(String, ShowS)] -> [(String, ShowS)])
-> (SearchDepth -> [(String, ShowS)] -> [(String, ShowS)])
-> Maybe SearchDepth
-> [(String, ShowS)]
-> [(String, ShowS)]
forall b a. b -> (a -> b) -> Maybe a -> b
Data.Maybe.maybe [(String, ShowS)] -> [(String, ShowS)]
forall a. a -> a
id (
(:) ((String, ShowS) -> [(String, ShowS)] -> [(String, ShowS)])
-> (SearchDepth -> (String, ShowS))
-> SearchDepth
-> [(String, ShowS)]
-> [(String, ShowS)]
forall b c a. (b -> c) -> (a -> b) -> a -> c
. (,) String
retireKillerMovesAfterTag (ShowS -> (String, ShowS))
-> (SearchDepth -> ShowS) -> SearchDepth -> (String, ShowS)
forall b c a. (b -> c) -> (a -> b) -> a -> c
. SearchDepth -> ShowS
forall a. Show a => a -> ShowS
shows
) Maybe SearchDepth
maybeRetireKillerMovesAfter ([(String, ShowS)] -> ShowS) -> [(String, ShowS)] -> ShowS
forall a b. (a -> b) -> a -> b
$ ([(String, ShowS)] -> [(String, ShowS)])
-> ((SearchDepth, SearchDepth)
-> [(String, ShowS)] -> [(String, ShowS)])
-> MaybeUseTranspositions
-> [(String, ShowS)]
-> [(String, ShowS)]
forall b a. b -> (a -> b) -> Maybe a -> b
Data.Maybe.maybe [(String, ShowS)] -> [(String, ShowS)]
forall a. a -> a
id (
\(SearchDepth
retireTranspositionsAfter, SearchDepth
minimumTranspositionSearchDepth) -> [(String, ShowS)] -> [(String, ShowS)] -> [(String, ShowS)]
forall a. [a] -> [a] -> [a]
(++) [
(
String
sortOnStandardOpeningMoveFrequencyTag,
SortOnStandardOpeningMoveFrequency -> ShowS
forall a. Show a => a -> ShowS
shows SortOnStandardOpeningMoveFrequency
sortOnStandardOpeningMoveFrequency
), (
String
retireTranspositionsAfterTag,
SearchDepth -> ShowS
forall a. Show a => a -> ShowS
shows SearchDepth
retireTranspositionsAfter
), (
String
minimumTranspositionSearchDepthTag,
SearchDepth -> ShowS
forall a. Show a => a -> ShowS
shows SearchDepth
minimumTranspositionSearchDepth
)
]
) MaybeUseTranspositions
maybeUseTranspositions [
(
String
trapRepeatedPositionsTag,
SortOnStandardOpeningMoveFrequency -> ShowS
forall a. Show a => a -> ShowS
shows SortOnStandardOpeningMoveFrequency
trapRepeatedPositions
), (
String
usePonderingTag,
SortOnStandardOpeningMoveFrequency -> ShowS
forall a. Show a => a -> ShowS
shows SortOnStandardOpeningMoveFrequency
usePondering
), (
String
Input.StandardOpeningOptions.tag,
StandardOpeningOptions -> ShowS
forall a. Show a => a -> ShowS
shows StandardOpeningOptions
standardOpeningOptions
), (
String
searchDepthByLogicalColourTag,
[(String, ShowS)] -> ShowS
Text.ShowList.showsAssociationList' ([(String, ShowS)] -> ShowS)
-> ([(LogicalColour, SearchDepth)] -> [(String, ShowS)])
-> [(LogicalColour, SearchDepth)]
-> ShowS
forall b c a. (b -> c) -> (a -> b) -> a -> c
. ((LogicalColour, SearchDepth) -> (String, ShowS))
-> [(LogicalColour, SearchDepth)] -> [(String, ShowS)]
forall a b. (a -> b) -> [a] -> [b]
map (LogicalColour -> String
forall a. Show a => a -> String
show (LogicalColour -> String)
-> (SearchDepth -> ShowS)
-> (LogicalColour, SearchDepth)
-> (String, ShowS)
forall (a :: * -> * -> *) b c b' c'.
Arrow a =>
a b c -> a b' c' -> a (b, b') (c, c')
*** SearchDepth -> ShowS
forall a. Show a => a -> ShowS
shows) ([(LogicalColour, SearchDepth)] -> ShowS)
-> [(LogicalColour, SearchDepth)] -> ShowS
forall a b. (a -> b) -> a -> b
$ SearchDepthByLogicalColour -> [(LogicalColour, SearchDepth)]
forall k a. Map k a -> [(k, a)]
Data.Map.Strict.assocs SearchDepthByLogicalColour
searchDepthByLogicalColour
)
]
instance Data.Default.Default SearchOptions where
def :: SearchOptions
def = MkSearchOptions :: SortOnStandardOpeningMoveFrequency
-> Maybe CaptureMoveSortAlgorithm
-> Maybe SearchDepth
-> Maybe SearchDepth
-> SortOnStandardOpeningMoveFrequency
-> SortOnStandardOpeningMoveFrequency
-> MaybeUseTranspositions
-> StandardOpeningOptions
-> SearchDepthByLogicalColour
-> SearchOptions
MkSearchOptions {
getSortOnStandardOpeningMoveFrequency :: SortOnStandardOpeningMoveFrequency
getSortOnStandardOpeningMoveFrequency = SortOnStandardOpeningMoveFrequency
False,
getMaybeCaptureMoveSortAlgorithm :: Maybe CaptureMoveSortAlgorithm
getMaybeCaptureMoveSortAlgorithm = Maybe CaptureMoveSortAlgorithm
forall a. Maybe a
Nothing,
getMaybeMinimumHammingDistance :: Maybe SearchDepth
getMaybeMinimumHammingDistance = Maybe SearchDepth
forall a. Maybe a
Nothing,
getMaybeRetireKillerMovesAfter :: Maybe SearchDepth
getMaybeRetireKillerMovesAfter = Maybe SearchDepth
forall a. Maybe a
Nothing,
getTrapRepeatedPositions :: SortOnStandardOpeningMoveFrequency
getTrapRepeatedPositions = SortOnStandardOpeningMoveFrequency
True,
getUsePondering :: SortOnStandardOpeningMoveFrequency
getUsePondering = SortOnStandardOpeningMoveFrequency
False,
getMaybeUseTranspositions :: MaybeUseTranspositions
getMaybeUseTranspositions = MaybeUseTranspositions
forall a. Maybe a
Nothing,
getStandardOpeningOptions :: StandardOpeningOptions
getStandardOpeningOptions = StandardOpeningOptions
forall a. Default a => a
Data.Default.def,
getSearchDepthByLogicalColour :: SearchDepthByLogicalColour
getSearchDepthByLogicalColour = SearchDepthByLogicalColour
forall k a. Map k a
Data.Map.Strict.empty
}
instance HXT.XmlPickler SearchOptions where
xpickle :: PU SearchOptions
xpickle = SearchOptions -> PU SearchOptions -> PU SearchOptions
forall a. Eq a => a -> PU a -> PU a
HXT.xpDefault SearchOptions
forall a. Default a => a
Data.Default.def (PU SearchOptions -> PU SearchOptions)
-> (PU
(SortOnStandardOpeningMoveFrequency,
Maybe CaptureMoveSortAlgorithm, Maybe SearchDepth,
Maybe SearchDepth, SortOnStandardOpeningMoveFrequency,
SortOnStandardOpeningMoveFrequency, MaybeUseTranspositions,
StandardOpeningOptions, SearchDepthByLogicalColour)
-> PU SearchOptions)
-> PU
(SortOnStandardOpeningMoveFrequency,
Maybe CaptureMoveSortAlgorithm, Maybe SearchDepth,
Maybe SearchDepth, SortOnStandardOpeningMoveFrequency,
SortOnStandardOpeningMoveFrequency, MaybeUseTranspositions,
StandardOpeningOptions, SearchDepthByLogicalColour)
-> PU SearchOptions
forall b c a. (b -> c) -> (a -> b) -> a -> c
. String -> PU SearchOptions -> PU SearchOptions
forall a. String -> PU a -> PU a
HXT.xpElem String
tag (PU SearchOptions -> PU SearchOptions)
-> (PU
(SortOnStandardOpeningMoveFrequency,
Maybe CaptureMoveSortAlgorithm, Maybe SearchDepth,
Maybe SearchDepth, SortOnStandardOpeningMoveFrequency,
SortOnStandardOpeningMoveFrequency, MaybeUseTranspositions,
StandardOpeningOptions, SearchDepthByLogicalColour)
-> PU SearchOptions)
-> PU
(SortOnStandardOpeningMoveFrequency,
Maybe CaptureMoveSortAlgorithm, Maybe SearchDepth,
Maybe SearchDepth, SortOnStandardOpeningMoveFrequency,
SortOnStandardOpeningMoveFrequency, MaybeUseTranspositions,
StandardOpeningOptions, SearchDepthByLogicalColour)
-> PU SearchOptions
forall b c a. (b -> c) -> (a -> b) -> a -> c
. ((SortOnStandardOpeningMoveFrequency,
Maybe CaptureMoveSortAlgorithm, Maybe SearchDepth,
Maybe SearchDepth, SortOnStandardOpeningMoveFrequency,
SortOnStandardOpeningMoveFrequency, MaybeUseTranspositions,
StandardOpeningOptions, SearchDepthByLogicalColour)
-> SearchOptions,
SearchOptions
-> (SortOnStandardOpeningMoveFrequency,
Maybe CaptureMoveSortAlgorithm, Maybe SearchDepth,
Maybe SearchDepth, SortOnStandardOpeningMoveFrequency,
SortOnStandardOpeningMoveFrequency, MaybeUseTranspositions,
StandardOpeningOptions, SearchDepthByLogicalColour))
-> PU
(SortOnStandardOpeningMoveFrequency,
Maybe CaptureMoveSortAlgorithm, Maybe SearchDepth,
Maybe SearchDepth, SortOnStandardOpeningMoveFrequency,
SortOnStandardOpeningMoveFrequency, MaybeUseTranspositions,
StandardOpeningOptions, SearchDepthByLogicalColour)
-> PU SearchOptions
forall a b. (a -> b, b -> a) -> PU a -> PU b
HXT.xpWrap (
\(SortOnStandardOpeningMoveFrequency
a, Maybe CaptureMoveSortAlgorithm
b, Maybe SearchDepth
c, Maybe SearchDepth
d, SortOnStandardOpeningMoveFrequency
e, SortOnStandardOpeningMoveFrequency
f, MaybeUseTranspositions
g, StandardOpeningOptions
h, SearchDepthByLogicalColour
i) -> SortOnStandardOpeningMoveFrequency
-> Maybe CaptureMoveSortAlgorithm
-> Maybe SearchDepth
-> Maybe SearchDepth
-> SortOnStandardOpeningMoveFrequency
-> SortOnStandardOpeningMoveFrequency
-> MaybeUseTranspositions
-> StandardOpeningOptions
-> SearchDepthByLogicalColour
-> SearchOptions
mkSearchOptions SortOnStandardOpeningMoveFrequency
a Maybe CaptureMoveSortAlgorithm
b Maybe SearchDepth
c Maybe SearchDepth
d SortOnStandardOpeningMoveFrequency
e SortOnStandardOpeningMoveFrequency
f MaybeUseTranspositions
g StandardOpeningOptions
h SearchDepthByLogicalColour
i,
\MkSearchOptions {
getSortOnStandardOpeningMoveFrequency :: SearchOptions -> SortOnStandardOpeningMoveFrequency
getSortOnStandardOpeningMoveFrequency = SortOnStandardOpeningMoveFrequency
sortOnStandardOpeningMoveFrequency,
getMaybeCaptureMoveSortAlgorithm :: SearchOptions -> Maybe CaptureMoveSortAlgorithm
getMaybeCaptureMoveSortAlgorithm = Maybe CaptureMoveSortAlgorithm
maybeCaptureMoveSortAlgorithm,
getMaybeMinimumHammingDistance :: SearchOptions -> Maybe SearchDepth
getMaybeMinimumHammingDistance = Maybe SearchDepth
maybeMinimumHammingDistance,
getMaybeRetireKillerMovesAfter :: SearchOptions -> Maybe SearchDepth
getMaybeRetireKillerMovesAfter = Maybe SearchDepth
maybeRetireKillerMovesAfter,
getTrapRepeatedPositions :: SearchOptions -> SortOnStandardOpeningMoveFrequency
getTrapRepeatedPositions = SortOnStandardOpeningMoveFrequency
trapRepeatedPositions,
getUsePondering :: SearchOptions -> SortOnStandardOpeningMoveFrequency
getUsePondering = SortOnStandardOpeningMoveFrequency
usePondering,
getMaybeUseTranspositions :: SearchOptions -> MaybeUseTranspositions
getMaybeUseTranspositions = MaybeUseTranspositions
maybeUseTranspositions,
getStandardOpeningOptions :: SearchOptions -> StandardOpeningOptions
getStandardOpeningOptions = StandardOpeningOptions
standardOpeningOptions,
getSearchDepthByLogicalColour :: SearchOptions -> SearchDepthByLogicalColour
getSearchDepthByLogicalColour = SearchDepthByLogicalColour
searchDepthByLogicalColour
} -> (
SortOnStandardOpeningMoveFrequency
sortOnStandardOpeningMoveFrequency,
Maybe CaptureMoveSortAlgorithm
maybeCaptureMoveSortAlgorithm,
Maybe SearchDepth
maybeMinimumHammingDistance,
Maybe SearchDepth
maybeRetireKillerMovesAfter,
SortOnStandardOpeningMoveFrequency
trapRepeatedPositions,
SortOnStandardOpeningMoveFrequency
usePondering,
MaybeUseTranspositions
maybeUseTranspositions,
StandardOpeningOptions
standardOpeningOptions,
SearchDepthByLogicalColour
searchDepthByLogicalColour
)
) (PU
(SortOnStandardOpeningMoveFrequency,
Maybe CaptureMoveSortAlgorithm, Maybe SearchDepth,
Maybe SearchDepth, SortOnStandardOpeningMoveFrequency,
SortOnStandardOpeningMoveFrequency, MaybeUseTranspositions,
StandardOpeningOptions, SearchDepthByLogicalColour)
-> PU SearchOptions)
-> PU
(SortOnStandardOpeningMoveFrequency,
Maybe CaptureMoveSortAlgorithm, Maybe SearchDepth,
Maybe SearchDepth, SortOnStandardOpeningMoveFrequency,
SortOnStandardOpeningMoveFrequency, MaybeUseTranspositions,
StandardOpeningOptions, SearchDepthByLogicalColour)
-> PU SearchOptions
forall a b. (a -> b) -> a -> b
$ PU SortOnStandardOpeningMoveFrequency
-> PU (Maybe CaptureMoveSortAlgorithm)
-> PU (Maybe SearchDepth)
-> PU (Maybe SearchDepth)
-> PU SortOnStandardOpeningMoveFrequency
-> PU SortOnStandardOpeningMoveFrequency
-> PU MaybeUseTranspositions
-> PU StandardOpeningOptions
-> PU SearchDepthByLogicalColour
-> PU
(SortOnStandardOpeningMoveFrequency,
Maybe CaptureMoveSortAlgorithm, Maybe SearchDepth,
Maybe SearchDepth, SortOnStandardOpeningMoveFrequency,
SortOnStandardOpeningMoveFrequency, MaybeUseTranspositions,
StandardOpeningOptions, SearchDepthByLogicalColour)
forall a b c d e f g h i.
PU a
-> PU b
-> PU c
-> PU d
-> PU e
-> PU f
-> PU g
-> PU h
-> PU i
-> PU (a, b, c, d, e, f, g, h, i)
HXT.xp9Tuple (
SearchOptions -> SortOnStandardOpeningMoveFrequency
getSortOnStandardOpeningMoveFrequency SearchOptions
def SortOnStandardOpeningMoveFrequency
-> PU SortOnStandardOpeningMoveFrequency
-> PU SortOnStandardOpeningMoveFrequency
forall a. Eq a => a -> PU a -> PU a
`HXT.xpDefault` String
-> PU SortOnStandardOpeningMoveFrequency
-> PU SortOnStandardOpeningMoveFrequency
forall a. String -> PU a -> PU a
HXT.xpAttr String
sortOnStandardOpeningMoveFrequencyTag PU SortOnStandardOpeningMoveFrequency
forall a. XmlPickler a => PU a
HXT.xpickle
) (
PU CaptureMoveSortAlgorithm -> PU (Maybe CaptureMoveSortAlgorithm)
forall a. PU a -> PU (Maybe a)
HXT.xpOption PU CaptureMoveSortAlgorithm
forall a. XmlPickler a => PU a
HXT.xpickle
) (
String -> PU SearchDepth -> PU (Maybe SearchDepth)
forall a. String -> PU a -> PU (Maybe a)
HXT.xpAttrImplied String
minimumHammingDistanceTag PU SearchDepth
HXT.xpInt
) (
String -> PU SearchDepth -> PU (Maybe SearchDepth)
forall a. String -> PU a -> PU (Maybe a)
HXT.xpAttrImplied String
retireKillerMovesAfterTag PU SearchDepth
HXT.xpInt
) (
SearchOptions -> SortOnStandardOpeningMoveFrequency
getTrapRepeatedPositions SearchOptions
def SortOnStandardOpeningMoveFrequency
-> PU SortOnStandardOpeningMoveFrequency
-> PU SortOnStandardOpeningMoveFrequency
forall a. Eq a => a -> PU a -> PU a
`HXT.xpDefault` String
-> PU SortOnStandardOpeningMoveFrequency
-> PU SortOnStandardOpeningMoveFrequency
forall a. String -> PU a -> PU a
HXT.xpAttr String
trapRepeatedPositionsTag PU SortOnStandardOpeningMoveFrequency
forall a. XmlPickler a => PU a
HXT.xpickle
) (
SearchOptions -> SortOnStandardOpeningMoveFrequency
getUsePondering SearchOptions
def SortOnStandardOpeningMoveFrequency
-> PU SortOnStandardOpeningMoveFrequency
-> PU SortOnStandardOpeningMoveFrequency
forall a. Eq a => a -> PU a -> PU a
`HXT.xpDefault` String
-> PU SortOnStandardOpeningMoveFrequency
-> PU SortOnStandardOpeningMoveFrequency
forall a. String -> PU a -> PU a
HXT.xpAttr String
usePonderingTag PU SortOnStandardOpeningMoveFrequency
forall a. XmlPickler a => PU a
HXT.xpickle
) (
PU (SearchDepth, SearchDepth) -> PU MaybeUseTranspositions
forall a. PU a -> PU (Maybe a)
HXT.xpOption (PU (SearchDepth, SearchDepth) -> PU MaybeUseTranspositions)
-> (PU (SearchDepth, SearchDepth) -> PU (SearchDepth, SearchDepth))
-> PU (SearchDepth, SearchDepth)
-> PU MaybeUseTranspositions
forall b c a. (b -> c) -> (a -> b) -> a -> c
. String
-> PU (SearchDepth, SearchDepth) -> PU (SearchDepth, SearchDepth)
forall a. String -> PU a -> PU a
HXT.xpElem String
"transpositions" (PU (SearchDepth, SearchDepth) -> PU MaybeUseTranspositions)
-> PU (SearchDepth, SearchDepth) -> PU MaybeUseTranspositions
forall a b. (a -> b) -> a -> b
$ String -> PU SearchDepth -> PU SearchDepth
forall a. String -> PU a -> PU a
HXT.xpAttr String
retireTranspositionsAfterTag PU SearchDepth
HXT.xpInt PU SearchDepth -> PU SearchDepth -> PU (SearchDepth, SearchDepth)
forall a b. PU a -> PU b -> PU (a, b)
`HXT.xpPair` String -> PU SearchDepth -> PU SearchDepth
forall a. String -> PU a -> PU a
HXT.xpAttr String
minimumTranspositionSearchDepthTag PU SearchDepth
HXT.xpInt
) PU StandardOpeningOptions
forall a. XmlPickler a => PU a
HXT.xpickle (
String
-> PU SearchDepthByLogicalColour -> PU SearchDepthByLogicalColour
forall a. String -> PU a -> PU a
HXT.xpElem String
searchDepthByLogicalColourTag (PU SearchDepthByLogicalColour -> PU SearchDepthByLogicalColour)
-> (PU (LogicalColour, SearchDepth)
-> PU SearchDepthByLogicalColour)
-> PU (LogicalColour, SearchDepth)
-> PU SearchDepthByLogicalColour
forall b c a. (b -> c) -> (a -> b) -> a -> c
. ([(LogicalColour, SearchDepth)] -> SearchDepthByLogicalColour,
SearchDepthByLogicalColour -> [(LogicalColour, SearchDepth)])
-> PU [(LogicalColour, SearchDepth)]
-> PU SearchDepthByLogicalColour
forall a b. (a -> b, b -> a) -> PU a -> PU b
HXT.xpWrap (
[(LogicalColour, SearchDepth)] -> SearchDepthByLogicalColour
forall k a. Ord k => [(k, a)] -> Map k a
Data.Map.Strict.fromList ([(LogicalColour, SearchDepth)] -> SearchDepthByLogicalColour)
-> ([(LogicalColour, SearchDepth)]
-> [(LogicalColour, SearchDepth)])
-> [(LogicalColour, SearchDepth)]
-> SearchDepthByLogicalColour
forall b c a. (b -> c) -> (a -> b) -> a -> c
. (
\[(LogicalColour, SearchDepth)]
l -> let
duplicateLogicalColours :: [LogicalColour]
duplicateLogicalColours = [LogicalColour] -> [LogicalColour]
forall (foldable :: * -> *) a.
(Foldable foldable, Ord a) =>
foldable a -> [a]
BishBosh.Data.Foldable.findDuplicates ([LogicalColour] -> [LogicalColour])
-> [LogicalColour] -> [LogicalColour]
forall a b. (a -> b) -> a -> b
$ ((LogicalColour, SearchDepth) -> LogicalColour)
-> [(LogicalColour, SearchDepth)] -> [LogicalColour]
forall a b. (a -> b) -> [a] -> [b]
map (LogicalColour, SearchDepth) -> LogicalColour
forall a b. (a, b) -> a
fst [(LogicalColour, SearchDepth)]
l
in if [LogicalColour] -> SortOnStandardOpeningMoveFrequency
forall (t :: * -> *) a.
Foldable t =>
t a -> SortOnStandardOpeningMoveFrequency
null [LogicalColour]
duplicateLogicalColours
then [(LogicalColour, SearchDepth)]
l
else Exception -> [(LogicalColour, SearchDepth)]
forall a e. Exception e => e -> a
Control.Exception.throw (Exception -> [(LogicalColour, SearchDepth)])
-> (String -> Exception)
-> String
-> [(LogicalColour, SearchDepth)]
forall b c a. (b -> c) -> (a -> b) -> a -> c
. String -> Exception
Data.Exception.mkDuplicateData (String -> Exception) -> ShowS -> String -> Exception
forall b c a. (b -> c) -> (a -> b) -> a -> c
. String -> ShowS
showString String
"BishBosh.Input.SearchOptions.xpickle:\t" ShowS -> ShowS -> ShowS
forall b c a. (b -> c) -> (a -> b) -> a -> c
. String -> ShowS
showString String
Attribute.LogicalColour.tag ShowS -> ShowS -> ShowS
forall b c a. (b -> c) -> (a -> b) -> a -> c
. String -> ShowS
showString String
"s must be distinct; " (String -> [(LogicalColour, SearchDepth)])
-> String -> [(LogicalColour, SearchDepth)]
forall a b. (a -> b) -> a -> b
$ [LogicalColour] -> ShowS
forall a. Show a => a -> ShowS
shows [LogicalColour]
duplicateLogicalColours String
"."
),
SearchDepthByLogicalColour -> [(LogicalColour, SearchDepth)]
forall k a. Map k a -> [(k, a)]
Data.Map.Strict.toList
) (PU [(LogicalColour, SearchDepth)]
-> PU SearchDepthByLogicalColour)
-> (PU (LogicalColour, SearchDepth)
-> PU [(LogicalColour, SearchDepth)])
-> PU (LogicalColour, SearchDepth)
-> PU SearchDepthByLogicalColour
forall b c a. (b -> c) -> (a -> b) -> a -> c
. PU (LogicalColour, SearchDepth)
-> PU [(LogicalColour, SearchDepth)]
forall a. PU a -> PU [a]
HXT.xpList (PU (LogicalColour, SearchDepth)
-> PU [(LogicalColour, SearchDepth)])
-> (PU (LogicalColour, SearchDepth)
-> PU (LogicalColour, SearchDepth))
-> PU (LogicalColour, SearchDepth)
-> PU [(LogicalColour, SearchDepth)]
forall b c a. (b -> c) -> (a -> b) -> a -> c
. String
-> PU (LogicalColour, SearchDepth)
-> PU (LogicalColour, SearchDepth)
forall a. String -> PU a -> PU a
HXT.xpElem (
String -> ShowS
showString String
"by" ShowS -> ShowS
forall a b. (a -> b) -> a -> b
$ ShowS
Text.Case.toUpperInitial String
Attribute.LogicalColour.tag
) (PU (LogicalColour, SearchDepth) -> PU SearchDepthByLogicalColour)
-> PU (LogicalColour, SearchDepth) -> PU SearchDepthByLogicalColour
forall a b. (a -> b) -> a -> b
$ PU LogicalColour
forall a. XmlPickler a => PU a
HXT.xpickle PU LogicalColour
-> PU SearchDepth -> PU (LogicalColour, SearchDepth)
forall a b. PU a -> PU b -> PU (a, b)
`HXT.xpPair` String -> PU SearchDepth -> PU SearchDepth
forall a. String -> PU a -> PU a
HXT.xpAttr String
searchDepthTag PU SearchDepth
HXT.xpInt
) where
def :: SearchOptions
def = SearchOptions
forall a. Default a => a
Data.Default.def
mkSearchOptions
:: SortOnStandardOpeningMoveFrequency
-> Maybe Attribute.CaptureMoveSortAlgorithm.CaptureMoveSortAlgorithm
-> Maybe HammingDistance
-> MaybeRetireAfterNMoves
-> TrapRepeatedPositions
-> UsePondering
-> MaybeUseTranspositions
-> Input.StandardOpeningOptions.StandardOpeningOptions
-> SearchDepthByLogicalColour
-> SearchOptions
mkSearchOptions :: SortOnStandardOpeningMoveFrequency
-> Maybe CaptureMoveSortAlgorithm
-> Maybe SearchDepth
-> Maybe SearchDepth
-> SortOnStandardOpeningMoveFrequency
-> SortOnStandardOpeningMoveFrequency
-> MaybeUseTranspositions
-> StandardOpeningOptions
-> SearchDepthByLogicalColour
-> SearchOptions
mkSearchOptions SortOnStandardOpeningMoveFrequency
sortOnStandardOpeningMoveFrequency Maybe CaptureMoveSortAlgorithm
maybeCaptureMoveSortAlgorithm Maybe SearchDepth
maybeMinimumHammingDistance Maybe SearchDepth
maybeRetireKillerMovesAfter SortOnStandardOpeningMoveFrequency
trapRepeatedPositions SortOnStandardOpeningMoveFrequency
usePondering MaybeUseTranspositions
maybeUseTranspositions StandardOpeningOptions
standardOpeningOptions SearchDepthByLogicalColour
searchDepthByLogicalColour
| Just SearchDepth
minimumHammingDistance <- Maybe SearchDepth
maybeMinimumHammingDistance
, SearchDepth
minimumHammingDistance SearchDepth -> SearchDepth -> SortOnStandardOpeningMoveFrequency
forall a. Ord a => a -> a -> SortOnStandardOpeningMoveFrequency
< SearchDepth
1 = Exception -> SearchOptions
forall a e. Exception e => e -> a
Control.Exception.throw (Exception -> SearchOptions)
-> (String -> Exception) -> String -> SearchOptions
forall b c a. (b -> c) -> (a -> b) -> a -> c
. String -> Exception
Data.Exception.mkOutOfBounds (String -> Exception) -> ShowS -> String -> Exception
forall b c a. (b -> c) -> (a -> b) -> a -> c
. String -> ShowS
showString String
"BishBosh.Input.SearchOptions.mkSearchOptions:\t" ShowS -> ShowS -> ShowS
forall b c a. (b -> c) -> (a -> b) -> a -> c
. String -> ShowS
showString String
minimumHammingDistanceTag ShowS -> ShowS -> ShowS
forall b c a. (b -> c) -> (a -> b) -> a -> c
. ShowS
Text.ShowList.showsAssociation (String -> SearchOptions) -> String -> SearchOptions
forall a b. (a -> b) -> a -> b
$ SearchDepth -> ShowS
forall a. Show a => a -> ShowS
shows SearchDepth
minimumHammingDistance String
" must exceed zero."
| Just SearchDepth
retireKillerMovesAfter <- Maybe SearchDepth
maybeRetireKillerMovesAfter
, SearchDepth
retireKillerMovesAfter SearchDepth -> SearchDepth -> SortOnStandardOpeningMoveFrequency
forall a. Ord a => a -> a -> SortOnStandardOpeningMoveFrequency
< SearchDepth
0 = Exception -> SearchOptions
forall a e. Exception e => e -> a
Control.Exception.throw (Exception -> SearchOptions)
-> (String -> Exception) -> String -> SearchOptions
forall b c a. (b -> c) -> (a -> b) -> a -> c
. String -> Exception
Data.Exception.mkOutOfBounds (String -> Exception) -> ShowS -> String -> Exception
forall b c a. (b -> c) -> (a -> b) -> a -> c
. String -> ShowS
showString String
"BishBosh.Input.SearchOptions.mkSearchOptions:\t" ShowS -> ShowS -> ShowS
forall b c a. (b -> c) -> (a -> b) -> a -> c
. String -> ShowS
showString String
retireKillerMovesAfterTag ShowS -> ShowS -> ShowS
forall b c a. (b -> c) -> (a -> b) -> a -> c
. ShowS
Text.ShowList.showsAssociation (String -> SearchOptions) -> String -> SearchOptions
forall a b. (a -> b) -> a -> b
$ SearchDepth -> ShowS
forall a. Show a => a -> ShowS
shows SearchDepth
retireKillerMovesAfter String
" can't be negative."
| let nAutomatedPlayers :: SearchDepth
nAutomatedPlayers = SearchDepthByLogicalColour -> SearchDepth
forall k a. Map k a -> SearchDepth
Data.Map.Strict.size SearchDepthByLogicalColour
searchDepthByLogicalColour
, SortOnStandardOpeningMoveFrequency
usePondering SortOnStandardOpeningMoveFrequency
-> SortOnStandardOpeningMoveFrequency
-> SortOnStandardOpeningMoveFrequency
&& SearchDepth
nAutomatedPlayers SearchDepth -> SearchDepth -> SortOnStandardOpeningMoveFrequency
forall a. Eq a => a -> a -> SortOnStandardOpeningMoveFrequency
/= SearchDepth
1
= Exception -> SearchOptions
forall a e. Exception e => e -> a
Control.Exception.throw (Exception -> SearchOptions)
-> (String -> Exception) -> String -> SearchOptions
forall b c a. (b -> c) -> (a -> b) -> a -> c
. String -> Exception
Data.Exception.mkIncompatibleData (String -> Exception) -> ShowS -> String -> Exception
forall b c a. (b -> c) -> (a -> b) -> a -> c
. String -> ShowS
showString String
"BishBosh.Input.SearchOptions.mkSearchOptions:\tpondering is pointless unless there's an automated player who can use the unused CPU-time during a manual player's move, but there're " (String -> SearchOptions) -> String -> SearchOptions
forall a b. (a -> b) -> a -> b
$ SearchDepth -> ShowS
forall a. Show a => a -> ShowS
shows SearchDepth
nAutomatedPlayers String
" automated players."
| Just (SearchDepth
retireTranspositionsAfter, SearchDepth
_) <- MaybeUseTranspositions
maybeUseTranspositions
, SearchDepth
retireTranspositionsAfter SearchDepth -> SearchDepth -> SortOnStandardOpeningMoveFrequency
forall a. Ord a => a -> a -> SortOnStandardOpeningMoveFrequency
< SearchDepth
0 = Exception -> SearchOptions
forall a e. Exception e => e -> a
Control.Exception.throw (Exception -> SearchOptions)
-> (String -> Exception) -> String -> SearchOptions
forall b c a. (b -> c) -> (a -> b) -> a -> c
. String -> Exception
Data.Exception.mkOutOfBounds (String -> Exception) -> ShowS -> String -> Exception
forall b c a. (b -> c) -> (a -> b) -> a -> c
. String -> ShowS
showString String
"BishBosh.Input.SearchOptions.mkSearchOptions:\t" ShowS -> ShowS -> ShowS
forall b c a. (b -> c) -> (a -> b) -> a -> c
. String -> ShowS
showString String
retireTranspositionsAfterTag ShowS -> ShowS -> ShowS
forall b c a. (b -> c) -> (a -> b) -> a -> c
. ShowS
Text.ShowList.showsAssociation (String -> SearchOptions) -> String -> SearchOptions
forall a b. (a -> b) -> a -> b
$ SearchDepth -> ShowS
forall a. Show a => a -> ShowS
shows SearchDepth
retireTranspositionsAfter String
" can't be negative."
| Just (SearchDepth
_, SearchDepth
minimumTranspositionSearchDepth) <- MaybeUseTranspositions
maybeUseTranspositions
, SearchDepth
minimumTranspositionSearchDepth SearchDepth -> SearchDepth -> SortOnStandardOpeningMoveFrequency
forall a. Ord a => a -> a -> SortOnStandardOpeningMoveFrequency
< SearchDepth
1 = Exception -> SearchOptions
forall a e. Exception e => e -> a
Control.Exception.throw (Exception -> SearchOptions)
-> (String -> Exception) -> String -> SearchOptions
forall b c a. (b -> c) -> (a -> b) -> a -> c
. String -> Exception
Data.Exception.mkOutOfBounds (String -> Exception) -> ShowS -> String -> Exception
forall b c a. (b -> c) -> (a -> b) -> a -> c
. String -> ShowS
showString String
"BishBosh.Input.SearchOptions.mkSearchOptions:\t" ShowS -> ShowS -> ShowS
forall b c a. (b -> c) -> (a -> b) -> a -> c
. String -> ShowS
showString String
minimumTranspositionSearchDepthTag ShowS -> ShowS -> ShowS
forall b c a. (b -> c) -> (a -> b) -> a -> c
. ShowS
Text.ShowList.showsAssociation (String -> SearchOptions) -> String -> SearchOptions
forall a b. (a -> b) -> a -> b
$ SearchDepth -> ShowS
forall a. Show a => a -> ShowS
shows SearchDepth
minimumTranspositionSearchDepth String
" must exceed zero."
| Just (SearchDepth
_, SearchDepth
minimumTranspositionSearchDepth) <- MaybeUseTranspositions
maybeUseTranspositions
, SortOnStandardOpeningMoveFrequency
-> SortOnStandardOpeningMoveFrequency
not (SortOnStandardOpeningMoveFrequency
-> SortOnStandardOpeningMoveFrequency)
-> SortOnStandardOpeningMoveFrequency
-> SortOnStandardOpeningMoveFrequency
forall a b. (a -> b) -> a -> b
$ SearchDepthByLogicalColour -> SortOnStandardOpeningMoveFrequency
forall k a. Map k a -> SortOnStandardOpeningMoveFrequency
Data.Map.Strict.null SearchDepthByLogicalColour
searchDepthByLogicalColour
, (SearchDepth -> SortOnStandardOpeningMoveFrequency)
-> SearchDepthByLogicalColour -> SortOnStandardOpeningMoveFrequency
forall (t :: * -> *) a.
Foldable t =>
(a -> SortOnStandardOpeningMoveFrequency)
-> t a -> SortOnStandardOpeningMoveFrequency
Data.Foldable.all (
SearchDepth
minimumTranspositionSearchDepth SearchDepth -> SearchDepth -> SortOnStandardOpeningMoveFrequency
forall a. Ord a => a -> a -> SortOnStandardOpeningMoveFrequency
>
) SearchDepthByLogicalColour
searchDepthByLogicalColour = Exception -> SearchOptions
forall a e. Exception e => e -> a
Control.Exception.throw (Exception -> SearchOptions)
-> (String -> Exception) -> String -> SearchOptions
forall b c a. (b -> c) -> (a -> b) -> a -> c
. String -> Exception
Data.Exception.mkOutOfBounds (String -> Exception) -> ShowS -> String -> Exception
forall b c a. (b -> c) -> (a -> b) -> a -> c
. String -> ShowS
showString String
"BishBosh.Input.SearchOptions.mkSearchOptions:\t" ShowS -> ShowS -> ShowS
forall b c a. (b -> c) -> (a -> b) -> a -> c
. String -> ShowS
showString String
minimumTranspositionSearchDepthTag ShowS -> ShowS -> ShowS
forall b c a. (b -> c) -> (a -> b) -> a -> c
. ShowS
Text.ShowList.showsAssociation (String -> SearchOptions) -> String -> SearchOptions
forall a b. (a -> b) -> a -> b
$ SearchDepth -> ShowS
forall a. Show a => a -> ShowS
shows SearchDepth
minimumTranspositionSearchDepth ShowS -> ShowS -> ShowS
forall b c a. (b -> c) -> (a -> b) -> a -> c
. String -> ShowS
showString String
" exceeds " ShowS -> ShowS -> ShowS
forall b c a. (b -> c) -> (a -> b) -> a -> c
. String -> ShowS
showString String
searchDepthTag ShowS -> ShowS -> ShowS
forall b c a. (b -> c) -> (a -> b) -> a -> c
. ShowS
Text.ShowList.showsAssociation ShowS -> ShowS
forall a b. (a -> b) -> a -> b
$ [(LogicalColour, SearchDepth)] -> ShowS
forall a. Show a => a -> ShowS
shows (SearchDepthByLogicalColour -> [(LogicalColour, SearchDepth)]
forall k a. Map k a -> [(k, a)]
Data.Map.Strict.toList SearchDepthByLogicalColour
searchDepthByLogicalColour) String
"."
| (SearchDepth -> SortOnStandardOpeningMoveFrequency)
-> SearchDepthByLogicalColour -> SortOnStandardOpeningMoveFrequency
forall (t :: * -> *) a.
Foldable t =>
(a -> SortOnStandardOpeningMoveFrequency)
-> t a -> SortOnStandardOpeningMoveFrequency
Data.Foldable.any (
SearchDepth -> SearchDepth -> SortOnStandardOpeningMoveFrequency
forall a. Ord a => a -> a -> SortOnStandardOpeningMoveFrequency
< SearchDepth
minimumSearchDepth
) SearchDepthByLogicalColour
searchDepthByLogicalColour = Exception -> SearchOptions
forall a e. Exception e => e -> a
Control.Exception.throw (Exception -> SearchOptions)
-> (String -> Exception) -> String -> SearchOptions
forall b c a. (b -> c) -> (a -> b) -> a -> c
. String -> Exception
Data.Exception.mkOutOfBounds (String -> Exception) -> ShowS -> String -> Exception
forall b c a. (b -> c) -> (a -> b) -> a -> c
. String -> ShowS
showString String
"BishBosh.Input.SearchOptions.mkSearchOptions:\t" (String -> SearchOptions) -> String -> SearchOptions
forall a b. (a -> b) -> a -> b
$ String -> ShowS
showString String
searchDepthTag String
" must be positive."
| SortOnStandardOpeningMoveFrequency
otherwise = MkSearchOptions :: SortOnStandardOpeningMoveFrequency
-> Maybe CaptureMoveSortAlgorithm
-> Maybe SearchDepth
-> Maybe SearchDepth
-> SortOnStandardOpeningMoveFrequency
-> SortOnStandardOpeningMoveFrequency
-> MaybeUseTranspositions
-> StandardOpeningOptions
-> SearchDepthByLogicalColour
-> SearchOptions
MkSearchOptions {
getSortOnStandardOpeningMoveFrequency :: SortOnStandardOpeningMoveFrequency
getSortOnStandardOpeningMoveFrequency = SortOnStandardOpeningMoveFrequency
sortOnStandardOpeningMoveFrequency,
getMaybeCaptureMoveSortAlgorithm :: Maybe CaptureMoveSortAlgorithm
getMaybeCaptureMoveSortAlgorithm = Maybe CaptureMoveSortAlgorithm
maybeCaptureMoveSortAlgorithm,
getMaybeMinimumHammingDistance :: Maybe SearchDepth
getMaybeMinimumHammingDistance = Maybe SearchDepth
maybeMinimumHammingDistance,
getMaybeRetireKillerMovesAfter :: Maybe SearchDepth
getMaybeRetireKillerMovesAfter = Maybe SearchDepth
maybeRetireKillerMovesAfter,
getTrapRepeatedPositions :: SortOnStandardOpeningMoveFrequency
getTrapRepeatedPositions = SortOnStandardOpeningMoveFrequency
trapRepeatedPositions,
getUsePondering :: SortOnStandardOpeningMoveFrequency
getUsePondering = SortOnStandardOpeningMoveFrequency
usePondering,
getMaybeUseTranspositions :: MaybeUseTranspositions
getMaybeUseTranspositions = MaybeUseTranspositions
maybeUseTranspositions,
getStandardOpeningOptions :: StandardOpeningOptions
getStandardOpeningOptions = StandardOpeningOptions
standardOpeningOptions,
getSearchDepthByLogicalColour :: SearchDepthByLogicalColour
getSearchDepthByLogicalColour = SearchDepthByLogicalColour
searchDepthByLogicalColour
}
getSearchDepth :: SearchOptions -> SearchDepth
getSearchDepth :: SearchOptions -> SearchDepth
getSearchDepth MkSearchOptions { getSearchDepthByLogicalColour :: SearchOptions -> SearchDepthByLogicalColour
getSearchDepthByLogicalColour = SearchDepthByLogicalColour
searchDepthByLogicalColour } = SearchDepth -> Maybe SearchDepth -> SearchDepth
forall a. a -> Maybe a -> a
Data.Maybe.fromMaybe SearchDepth
defaultSearchDepth (Maybe SearchDepth -> SearchDepth)
-> ([SearchDepth] -> Maybe SearchDepth)
-> [SearchDepth]
-> SearchDepth
forall b c a. (b -> c) -> (a -> b) -> a -> c
. [SearchDepth] -> Maybe SearchDepth
forall a. [a] -> Maybe a
Data.Maybe.listToMaybe ([SearchDepth] -> SearchDepth) -> [SearchDepth] -> SearchDepth
forall a b. (a -> b) -> a -> b
$ SearchDepthByLogicalColour -> [SearchDepth]
forall k a. Map k a -> [a]
Data.Map.Strict.elems SearchDepthByLogicalColour
searchDepthByLogicalColour
type RecordKillerMoves = Bool
recordKillerMoves :: SearchOptions -> RecordKillerMoves
recordKillerMoves :: SearchOptions -> SortOnStandardOpeningMoveFrequency
recordKillerMoves MkSearchOptions { getMaybeRetireKillerMovesAfter :: SearchOptions -> Maybe SearchDepth
getMaybeRetireKillerMovesAfter = Maybe SearchDepth
maybeRetireKillerMovesAfter } = Maybe SearchDepth -> SortOnStandardOpeningMoveFrequency
forall a. Maybe a -> SortOnStandardOpeningMoveFrequency
Data.Maybe.isJust Maybe SearchDepth
maybeRetireKillerMovesAfter
maybeRetireTranspositionsAfter :: SearchOptions -> MaybeRetireAfterNMoves
maybeRetireTranspositionsAfter :: SearchOptions -> Maybe SearchDepth
maybeRetireTranspositionsAfter MkSearchOptions { getMaybeUseTranspositions :: SearchOptions -> MaybeUseTranspositions
getMaybeUseTranspositions = MaybeUseTranspositions
maybeUseTranspositions } = ((SearchDepth, SearchDepth) -> SearchDepth)
-> MaybeUseTranspositions -> Maybe SearchDepth
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
fmap (SearchDepth, SearchDepth) -> SearchDepth
forall a b. (a, b) -> a
fst MaybeUseTranspositions
maybeUseTranspositions
maybeMinimumTranspositionSearchDepth :: SearchOptions -> Maybe SearchDepth
maybeMinimumTranspositionSearchDepth :: SearchOptions -> Maybe SearchDepth
maybeMinimumTranspositionSearchDepth MkSearchOptions { getMaybeUseTranspositions :: SearchOptions -> MaybeUseTranspositions
getMaybeUseTranspositions = MaybeUseTranspositions
maybeUseTranspositions } = ((SearchDepth, SearchDepth) -> SearchDepth)
-> MaybeUseTranspositions -> Maybe SearchDepth
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
fmap (SearchDepth, SearchDepth) -> SearchDepth
forall a b. (a, b) -> b
snd MaybeUseTranspositions
maybeUseTranspositions
type Transformation = SearchOptions -> SearchOptions
setSearchDepth :: SearchDepth -> Transformation
setSearchDepth :: SearchDepth -> Transformation
setSearchDepth SearchDepth
searchDepth searchOptions :: SearchOptions
searchOptions@MkSearchOptions { getSearchDepthByLogicalColour :: SearchOptions -> SearchDepthByLogicalColour
getSearchDepthByLogicalColour = SearchDepthByLogicalColour
searchDepthByLogicalColour }
| SearchDepth
searchDepth SearchDepth -> SearchDepth -> SortOnStandardOpeningMoveFrequency
forall a. Ord a => a -> a -> SortOnStandardOpeningMoveFrequency
< SearchDepth
minimumSearchDepth = Exception -> SearchOptions
forall a e. Exception e => e -> a
Control.Exception.throw (Exception -> SearchOptions)
-> (String -> Exception) -> String -> SearchOptions
forall b c a. (b -> c) -> (a -> b) -> a -> c
. String -> Exception
Data.Exception.mkOutOfBounds (String -> Exception) -> ShowS -> String -> Exception
forall b c a. (b -> c) -> (a -> b) -> a -> c
. String -> ShowS
showString String
"BishBosh.Input.SearchOptions.setSearchDepth:\t" ShowS -> ShowS -> ShowS
forall b c a. (b -> c) -> (a -> b) -> a -> c
. String -> ShowS
showString String
searchDepthTag ShowS -> ShowS -> ShowS
forall b c a. (b -> c) -> (a -> b) -> a -> c
. ShowS
Text.ShowList.showsAssociation (String -> SearchOptions) -> String -> SearchOptions
forall a b. (a -> b) -> a -> b
$ SearchDepth -> ShowS
forall a. Show a => a -> ShowS
shows SearchDepth
searchDepth String
" must be positive."
| SortOnStandardOpeningMoveFrequency
otherwise = SearchOptions
searchOptions { getSearchDepthByLogicalColour :: SearchDepthByLogicalColour
getSearchDepthByLogicalColour = (SearchDepth -> SearchDepth)
-> SearchDepthByLogicalColour -> SearchDepthByLogicalColour
forall a b k. (a -> b) -> Map k a -> Map k b
Data.Map.Strict.map (SearchDepth -> SearchDepth -> SearchDepth
forall a b. a -> b -> a
const SearchDepth
searchDepth) SearchDepthByLogicalColour
searchDepthByLogicalColour }
swapSearchDepth :: Transformation
swapSearchDepth :: Transformation
swapSearchDepth searchOptions :: SearchOptions
searchOptions@MkSearchOptions {
getSearchDepthByLogicalColour :: SearchOptions -> SearchDepthByLogicalColour
getSearchDepthByLogicalColour = SearchDepthByLogicalColour
searchDepthByLogicalColour
} = SearchOptions
searchOptions {
getSearchDepthByLogicalColour :: SearchDepthByLogicalColour
getSearchDepthByLogicalColour = (LogicalColour -> LogicalColour)
-> SearchDepthByLogicalColour -> SearchDepthByLogicalColour
forall k2 k1 a. Ord k2 => (k1 -> k2) -> Map k1 a -> Map k2 a
Data.Map.Strict.mapKeys LogicalColour -> LogicalColour
forall a. Opposable a => a -> a
Property.Opposable.getOpposite SearchDepthByLogicalColour
searchDepthByLogicalColour
}
type Reader = Control.Monad.Reader.Reader SearchOptions