bishbosh-0.0.0.8: Plays chess.
Safe HaskellNone
LanguageHaskell2010

BishBosh.Notation.PureCoordinate

Description

AUTHOR
Dr. Alistair Ward
DESCRIPTION
Synopsis

Types

Data-types

data PureCoordinate x y Source #

Defines a move, to enable io in PureCoordinate/-notation.

Instances

Instances details
(Eq x, Eq y) => Eq (PureCoordinate x y) Source # 
Instance details

Defined in BishBosh.Notation.PureCoordinate

(Enum x, Enum y, Ord x, Ord y) => Read (PureCoordinate x y) Source # 
Instance details

Defined in BishBosh.Notation.PureCoordinate

(Enum x, Enum y) => Show (PureCoordinate x y) Source # 
Instance details

Defined in BishBosh.Notation.PureCoordinate

Promotable (PureCoordinate x y) Source # 
Instance details

Defined in BishBosh.Notation.PureCoordinate

Constants

origin :: (Int, Int) Source #

The origin of the coordinate-system.

regexSyntax :: String Source #

Defines using a regex, the required syntax.

Functions

encode :: (Enum x, Enum y) => Coordinates x y -> (ShowS, ShowS) Source #

Encodes the ordinate & abscissa.

showsCoordinates :: (Enum x, Enum y) => Coordinates x y -> ShowS Source #

Shows the specified coordinates.

readsCoordinates :: (Enum x, Enum y, Ord x, Ord y) => ReadS (Coordinates x y) Source #

Reads coordinates.

abscissaParser :: Enum x => TextParser x Source #

Parse an x-coordinate.

ordinateParser :: Enum y => TextParser y Source #

Parse a y-coordinate.

coordinatesParser :: (Enum x, Enum y, Ord x, Ord y) => TextParser (Coordinates x y) Source #

Parse a pair of coordinates.

Constructors

mkPureCoordinate :: Move x y -> Maybe Rank -> PureCoordinate x y Source #

Smart constructor.

mkPureCoordinate' :: Promotable promotable => Move x y -> promotable -> PureCoordinate x y Source #

Smart constructor.

Predicates