| Safe Haskell | None |
|---|---|
| Language | Haskell2010 |
Pinchot.Examples.SyntaxTrees
Description
This module shows how to use Template Haskell to generate the data types corresponding to your context-free grammar. You will want to look at the source; the Haddocks will show only the generated types and not the Template Haskell that was used to generate them.
Documentation
Constructors
| Letter (t, a) |
Instances
| Bifunctor Letter Source # | |
| Functor (Letter t) Source # | |
| Foldable (Letter t) Source # | |
| Traversable (Letter t) Source # | |
| (Eq a, Eq t) => Eq (Letter t a) Source # | |
| (Ord a, Ord t) => Ord (Letter t a) Source # | |
| (Show a, Show t) => Show (Letter t a) Source # | |
| Generic (Letter t a) Source # | |
| Wrapped (Letter t a) Source # | |
| (PrettyVal t, PrettyVal a) => PrettyVal (Letter t a) Source # | |
| type Rep (Letter t a) Source # | |
| type Unwrapped (Letter t a) Source # | |
Constructors
| NoLetter | |
| ConsLetter (Letter t a) (Letters t a) |
Instances
| Bifunctor Letters Source # | |
| Functor (Letters t) Source # | |
| Foldable (Letters t) Source # | |
| Traversable (Letters t) Source # | |
| (Eq t, Eq a) => Eq (Letters t a) Source # | |
| (Ord t, Ord a) => Ord (Letters t a) Source # | |
| (Show t, Show a) => Show (Letters t a) Source # | |
| Generic (Letters t a) Source # | |
| (PrettyVal t, PrettyVal a) => PrettyVal (Letters t a) Source # | |
| type Rep (Letters t a) Source # | |
data PostalWord t a Source #
Constructors
| PostalWord | |
Fields
| |
Instances
| Bifunctor PostalWord Source # | |
| Functor (PostalWord t) Source # | |
| Foldable (PostalWord t) Source # | |
| Traversable (PostalWord t) Source # | |
| (Eq t, Eq a) => Eq (PostalWord t a) Source # | |
| (Ord t, Ord a) => Ord (PostalWord t a) Source # | |
| (Show t, Show a) => Show (PostalWord t a) Source # | |
| Generic (PostalWord t a) Source # | |
| (PrettyVal t, PrettyVal a) => PrettyVal (PostalWord t a) Source # | |
| type Rep (PostalWord t a) Source # | |
Constructors
| Space (t, a) |
Instances
| Bifunctor Space Source # | |
| Functor (Space t) Source # | |
| Foldable (Space t) Source # | |
| Traversable (Space t) Source # | |
| (Eq a, Eq t) => Eq (Space t a) Source # | |
| (Ord a, Ord t) => Ord (Space t a) Source # | |
| (Show a, Show t) => Show (Space t a) Source # | |
| Generic (Space t a) Source # | |
| Wrapped (Space t a) Source # | |
| (PrettyVal t, PrettyVal a) => PrettyVal (Space t a) Source # | |
| type Rep (Space t a) Source # | |
| type Unwrapped (Space t a) Source # | |
data PreSpacedWord t a Source #
Constructors
| PreSpacedWord | |
Fields
| |
Instances
| Bifunctor PreSpacedWord Source # | |
| Functor (PreSpacedWord t) Source # | |
| Foldable (PreSpacedWord t) Source # | |
| Traversable (PreSpacedWord t) Source # | |
| (Eq t, Eq a) => Eq (PreSpacedWord t a) Source # | |
| (Ord t, Ord a) => Ord (PreSpacedWord t a) Source # | |
| (Show t, Show a) => Show (PreSpacedWord t a) Source # | |
| Generic (PreSpacedWord t a) Source # | |
| (PrettyVal t, PrettyVal a) => PrettyVal (PreSpacedWord t a) Source # | |
| type Rep (PreSpacedWord t a) Source # | |
newtype PreSpacedWord'Star t a Source #
Constructors
| PreSpacedWord'Star [PreSpacedWord t a] |
Instances
| Bifunctor PreSpacedWord'Star Source # | |
| Functor (PreSpacedWord'Star t) Source # | |
| Foldable (PreSpacedWord'Star t) Source # | |
| Traversable (PreSpacedWord'Star t) Source # | |
| (Eq a, Eq t) => Eq (PreSpacedWord'Star t a) Source # | |
| (Ord a, Ord t) => Ord (PreSpacedWord'Star t a) Source # | |
| (Show a, Show t) => Show (PreSpacedWord'Star t a) Source # | |
| Generic (PreSpacedWord'Star t a) Source # | |
| Semigroup (PreSpacedWord'Star t a) Source # | |
| Monoid (PreSpacedWord'Star t a) Source # | |
| Wrapped (PreSpacedWord'Star t a) Source # | |
| (PrettyVal t, PrettyVal a) => PrettyVal (PreSpacedWord'Star t a) Source # | |
| type Rep (PreSpacedWord'Star t a) Source # | |
| type Unwrapped (PreSpacedWord'Star t a) Source # | |
Constructors
| Words | |
Fields
| |
Instances
| Bifunctor Words Source # | |
| Functor (Words t) Source # | |
| Foldable (Words t) Source # | |
| Traversable (Words t) Source # | |
| (Eq a, Eq t) => Eq (Words t a) Source # | |
| (Ord a, Ord t) => Ord (Words t a) Source # | |
| (Show a, Show t) => Show (Words t a) Source # | |
| Generic (Words t a) Source # | |
| (PrettyVal t, PrettyVal a) => PrettyVal (Words t a) Source # | |
| type Rep (Words t a) Source # | |
Constructors
| Comma (t, a) |
Instances
| Bifunctor Comma Source # | |
| Functor (Comma t) Source # | |
| Foldable (Comma t) Source # | |
| Traversable (Comma t) Source # | |
| (Eq a, Eq t) => Eq (Comma t a) Source # | |
| (Ord a, Ord t) => Ord (Comma t a) Source # | |
| (Show a, Show t) => Show (Comma t a) Source # | |
| Generic (Comma t a) Source # | |
| Wrapped (Comma t a) Source # | |
| (PrettyVal t, PrettyVal a) => PrettyVal (Comma t a) Source # | |
| type Rep (Comma t a) Source # | |
| type Unwrapped (Comma t a) Source # | |
data CommaSpace t a Source #
Constructors
| CommaSpace | |
Fields
| |
Instances
| Bifunctor CommaSpace Source # | |
| Functor (CommaSpace t) Source # | |
| Foldable (CommaSpace t) Source # | |
| Traversable (CommaSpace t) Source # | |
| (Eq t, Eq a) => Eq (CommaSpace t a) Source # | |
| (Ord t, Ord a) => Ord (CommaSpace t a) Source # | |
| (Show t, Show a) => Show (CommaSpace t a) Source # | |
| Generic (CommaSpace t a) Source # | |
| (PrettyVal t, PrettyVal a) => PrettyVal (CommaSpace t a) Source # | |
| type Rep (CommaSpace t a) Source # | |
Constructors
| Newline (t, a) |
Instances
| Bifunctor Newline Source # | |
| Functor (Newline t) Source # | |
| Foldable (Newline t) Source # | |
| Traversable (Newline t) Source # | |
| (Eq a, Eq t) => Eq (Newline t a) Source # | |
| (Ord a, Ord t) => Ord (Newline t a) Source # | |
| (Show a, Show t) => Show (Newline t a) Source # | |
| Generic (Newline t a) Source # | |
| Wrapped (Newline t a) Source # | |
| (PrettyVal t, PrettyVal a) => PrettyVal (Newline t a) Source # | |
| type Rep (Newline t a) Source # | |
| type Unwrapped (Newline t a) Source # | |
Constructors
| Separator'CommaSpace (CommaSpace t a) | |
| Separator'Newline (Newline t a) |
Instances
| Bifunctor Separator Source # | |
| Functor (Separator t) Source # | |
| Foldable (Separator t) Source # | |
| Traversable (Separator t) Source # | |
| (Eq a, Eq t) => Eq (Separator t a) Source # | |
| (Ord a, Ord t) => Ord (Separator t a) Source # | |
| (Show a, Show t) => Show (Separator t a) Source # | |
| Generic (Separator t a) Source # | |
| (PrettyVal t, PrettyVal a) => PrettyVal (Separator t a) Source # | |
| type Rep (Separator t a) Source # | |
Constructors
| NameLine | |
Fields
| |
Instances
| Bifunctor NameLine Source # | |
| Functor (NameLine t) Source # | |
| Foldable (NameLine t) Source # | |
| Traversable (NameLine t) Source # | |
| (Eq t, Eq a) => Eq (NameLine t a) Source # | |
| (Ord t, Ord a) => Ord (NameLine t a) Source # | |
| (Show t, Show a) => Show (NameLine t a) Source # | |
| Generic (NameLine t a) Source # | |
| (PrettyVal t, PrettyVal a) => PrettyVal (NameLine t a) Source # | |
| type Rep (NameLine t a) Source # | |
Constructors
| Digit (t, a) |
Instances
| Bifunctor Digit Source # | |
| Functor (Digit t) Source # | |
| Foldable (Digit t) Source # | |
| Traversable (Digit t) Source # | |
| (Eq a, Eq t) => Eq (Digit t a) Source # | |
| (Ord a, Ord t) => Ord (Digit t a) Source # | |
| (Show a, Show t) => Show (Digit t a) Source # | |
| Generic (Digit t a) Source # | |
| Wrapped (Digit t a) Source # | |
| (PrettyVal t, PrettyVal a) => PrettyVal (Digit t a) Source # | |
| type Rep (Digit t a) Source # | |
| type Unwrapped (Digit t a) Source # | |
newtype Digit'Plus t a Source #
Constructors
| Digit'Plus (NonEmpty (Digit t a)) |
Instances
| Bifunctor Digit'Plus Source # | |
| Functor (Digit'Plus t) Source # | |
| Foldable (Digit'Plus t) Source # | |
| Traversable (Digit'Plus t) Source # | |
| (Eq t, Eq a) => Eq (Digit'Plus t a) Source # | |
| (Ord t, Ord a) => Ord (Digit'Plus t a) Source # | |
| (Show t, Show a) => Show (Digit'Plus t a) Source # | |
| Generic (Digit'Plus t a) Source # | |
| Semigroup (Digit'Plus t a) Source # | |
| Wrapped (Digit'Plus t a) Source # | |
| (PrettyVal t, PrettyVal a) => PrettyVal (Digit'Plus t a) Source # | |
| type Rep (Digit'Plus t a) Source # | |
| type Unwrapped (Digit'Plus t a) Source # | |
Constructors
| Number (Digit'Plus t a) |
Instances
| Bifunctor Number Source # | |
| Functor (Number t) Source # | |
| Foldable (Number t) Source # | |
| Traversable (Number t) Source # | |
| (Eq a, Eq t) => Eq (Number t a) Source # | |
| (Ord a, Ord t) => Ord (Number t a) Source # | |
| (Show a, Show t) => Show (Number t a) Source # | |
| Generic (Number t a) Source # | |
| Semigroup (Number t a) Source # | |
| Wrapped (Number t a) Source # | |
| (PrettyVal t, PrettyVal a) => PrettyVal (Number t a) Source # | |
| type Rep (Number t a) Source # | |
| type Unwrapped (Number t a) Source # | |
Constructors
| North (t, a) |
Instances
| Bifunctor North Source # | |
| Functor (North t) Source # | |
| Foldable (North t) Source # | |
| Traversable (North t) Source # | |
| (Eq a, Eq t) => Eq (North t a) Source # | |
| (Ord a, Ord t) => Ord (North t a) Source # | |
| (Show a, Show t) => Show (North t a) Source # | |
| Generic (North t a) Source # | |
| Wrapped (North t a) Source # | |
| (PrettyVal t, PrettyVal a) => PrettyVal (North t a) Source # | |
| type Rep (North t a) Source # | |
| type Unwrapped (North t a) Source # | |
Constructors
| South (t, a) |
Instances
| Bifunctor South Source # | |
| Functor (South t) Source # | |
| Foldable (South t) Source # | |
| Traversable (South t) Source # | |
| (Eq a, Eq t) => Eq (South t a) Source # | |
| (Ord a, Ord t) => Ord (South t a) Source # | |
| (Show a, Show t) => Show (South t a) Source # | |
| Generic (South t a) Source # | |
| Wrapped (South t a) Source # | |
| (PrettyVal t, PrettyVal a) => PrettyVal (South t a) Source # | |
| type Rep (South t a) Source # | |
| type Unwrapped (South t a) Source # | |
Constructors
| East (t, a) |
Instances
| Bifunctor East Source # | |
| Functor (East t) Source # | |
| Foldable (East t) Source # | |
| Traversable (East t) Source # | |
| (Eq a, Eq t) => Eq (East t a) Source # | |
| (Ord a, Ord t) => Ord (East t a) Source # | |
| (Show a, Show t) => Show (East t a) Source # | |
| Generic (East t a) Source # | |
| Wrapped (East t a) Source # | |
| (PrettyVal t, PrettyVal a) => PrettyVal (East t a) Source # | |
| type Rep (East t a) Source # | |
| type Unwrapped (East t a) Source # | |
Constructors
| West (t, a) |
Instances
| Bifunctor West Source # | |
| Functor (West t) Source # | |
| Foldable (West t) Source # | |
| Traversable (West t) Source # | |
| (Eq a, Eq t) => Eq (West t a) Source # | |
| (Ord a, Ord t) => Ord (West t a) Source # | |
| (Show a, Show t) => Show (West t a) Source # | |
| Generic (West t a) Source # | |
| Wrapped (West t a) Source # | |
| (PrettyVal t, PrettyVal a) => PrettyVal (West t a) Source # | |
| type Rep (West t a) Source # | |
| type Unwrapped (West t a) Source # | |
Instances
| Bifunctor NE Source # | |
| Functor (NE t) Source # | |
| Foldable (NE t) Source # | |
| Traversable (NE t) Source # | |
| (Eq a, Eq t) => Eq (NE t a) Source # | |
| (Ord a, Ord t) => Ord (NE t a) Source # | |
| (Show a, Show t) => Show (NE t a) Source # | |
| Generic (NE t a) Source # | |
| (PrettyVal t, PrettyVal a) => PrettyVal (NE t a) Source # | |
| type Rep (NE t a) Source # | |
Instances
| Bifunctor NW Source # | |
| Functor (NW t) Source # | |
| Foldable (NW t) Source # | |
| Traversable (NW t) Source # | |
| (Eq a, Eq t) => Eq (NW t a) Source # | |
| (Ord a, Ord t) => Ord (NW t a) Source # | |
| (Show a, Show t) => Show (NW t a) Source # | |
| Generic (NW t a) Source # | |
| (PrettyVal t, PrettyVal a) => PrettyVal (NW t a) Source # | |
| type Rep (NW t a) Source # | |
Instances
| Bifunctor SE Source # | |
| Functor (SE t) Source # | |
| Foldable (SE t) Source # | |
| Traversable (SE t) Source # | |
| (Eq a, Eq t) => Eq (SE t a) Source # | |
| (Ord a, Ord t) => Ord (SE t a) Source # | |
| (Show a, Show t) => Show (SE t a) Source # | |
| Generic (SE t a) Source # | |
| (PrettyVal t, PrettyVal a) => PrettyVal (SE t a) Source # | |
| type Rep (SE t a) Source # | |
Instances
| Bifunctor SW Source # | |
| Functor (SW t) Source # | |
| Foldable (SW t) Source # | |
| Traversable (SW t) Source # | |
| (Eq a, Eq t) => Eq (SW t a) Source # | |
| (Ord a, Ord t) => Ord (SW t a) Source # | |
| (Show a, Show t) => Show (SW t a) Source # | |
| Generic (SW t a) Source # | |
| (PrettyVal t, PrettyVal a) => PrettyVal (SW t a) Source # | |
| type Rep (SW t a) Source # | |
Constructors
| Direction'North (North t a) | |
| Direction'South (South t a) | |
| Direction'East (East t a) | |
| Direction'West (West t a) | |
| Direction'NE (NE t a) | |
| Direction'NW (NW t a) | |
| Direction'SE (SE t a) | |
| Direction'SW (SW t a) |
Instances
| Bifunctor Direction Source # | |
| Functor (Direction t) Source # | |
| Foldable (Direction t) Source # | |
| Traversable (Direction t) Source # | |
| (Eq t, Eq a) => Eq (Direction t a) Source # | |
| (Ord t, Ord a) => Ord (Direction t a) Source # | |
| (Show t, Show a) => Show (Direction t a) Source # | |
| Generic (Direction t a) Source # | |
| (PrettyVal t, PrettyVal a) => PrettyVal (Direction t a) Source # | |
| type Rep (Direction t a) Source # | |
data DirectionSpace t a Source #
Constructors
| DirectionSpace | |
Fields
| |
Instances
| Bifunctor DirectionSpace Source # | |
| Functor (DirectionSpace t) Source # | |
| Foldable (DirectionSpace t) Source # | |
| Traversable (DirectionSpace t) Source # | |
| (Eq a, Eq t) => Eq (DirectionSpace t a) Source # | |
| (Ord a, Ord t) => Ord (DirectionSpace t a) Source # | |
| (Show a, Show t) => Show (DirectionSpace t a) Source # | |
| Generic (DirectionSpace t a) Source # | |
| (PrettyVal t, PrettyVal a) => PrettyVal (DirectionSpace t a) Source # | |
| type Rep (DirectionSpace t a) Source # | |
newtype DirectionSpace'Opt t a Source #
Constructors
| DirectionSpace'Opt (Maybe (DirectionSpace t a)) |
Instances
| Bifunctor DirectionSpace'Opt Source # | |
| Functor (DirectionSpace'Opt t) Source # | |
| Foldable (DirectionSpace'Opt t) Source # | |
| Traversable (DirectionSpace'Opt t) Source # | |
| (Eq t, Eq a) => Eq (DirectionSpace'Opt t a) Source # | |
| (Ord t, Ord a) => Ord (DirectionSpace'Opt t a) Source # | |
| (Show t, Show a) => Show (DirectionSpace'Opt t a) Source # | |
| Generic (DirectionSpace'Opt t a) Source # | |
| Wrapped (DirectionSpace'Opt t a) Source # | |
| (PrettyVal t, PrettyVal a) => PrettyVal (DirectionSpace'Opt t a) Source # | |
| type Rep (DirectionSpace'Opt t a) Source # | |
| type Unwrapped (DirectionSpace'Opt t a) Source # | |
newtype StreetName t a Source #
Constructors
| StreetName (Words t a) |
Instances
| Bifunctor StreetName Source # | |
| Functor (StreetName t) Source # | |
| Foldable (StreetName t) Source # | |
| Traversable (StreetName t) Source # | |
| (Eq t, Eq a) => Eq (StreetName t a) Source # | |
| (Ord t, Ord a) => Ord (StreetName t a) Source # | |
| (Show t, Show a) => Show (StreetName t a) Source # | |
| Generic (StreetName t a) Source # | |
| Wrapped (StreetName t a) Source # | |
| (PrettyVal t, PrettyVal a) => PrettyVal (StreetName t a) Source # | |
| type Rep (StreetName t a) Source # | |
| type Unwrapped (StreetName t a) Source # | |
Instances
| Bifunctor Street Source # | |
| Functor (Street t) Source # | |
| Foldable (Street t) Source # | |
| Traversable (Street t) Source # | |
| (Eq a, Eq t) => Eq (Street t a) Source # | |
| (Ord a, Ord t) => Ord (Street t a) Source # | |
| (Show a, Show t) => Show (Street t a) Source # | |
| Generic (Street t a) Source # | |
| (PrettyVal t, PrettyVal a) => PrettyVal (Street t a) Source # | |
| type Rep (Street t a) Source # | |
Instances
| Bifunctor Avenue Source # | |
| Functor (Avenue t) Source # | |
| Foldable (Avenue t) Source # | |
| Traversable (Avenue t) Source # | |
| (Eq a, Eq t) => Eq (Avenue t a) Source # | |
| (Ord a, Ord t) => Ord (Avenue t a) Source # | |
| (Show a, Show t) => Show (Avenue t a) Source # | |
| Generic (Avenue t a) Source # | |
| (PrettyVal t, PrettyVal a) => PrettyVal (Avenue t a) Source # | |
| type Rep (Avenue t a) Source # | |
Instances
| Bifunctor Way Source # | |
| Functor (Way t) Source # | |
| Foldable (Way t) Source # | |
| Traversable (Way t) Source # | |
| (Eq a, Eq t) => Eq (Way t a) Source # | |
| (Ord a, Ord t) => Ord (Way t a) Source # | |
| (Show a, Show t) => Show (Way t a) Source # | |
| Generic (Way t a) Source # | |
| (PrettyVal t, PrettyVal a) => PrettyVal (Way t a) Source # | |
| type Rep (Way t a) Source # | |
newtype Boulevard t a Source #
Instances
| Bifunctor Boulevard Source # | |
| Functor (Boulevard t) Source # | |
| Foldable (Boulevard t) Source # | |
| Traversable (Boulevard t) Source # | |
| (Eq a, Eq t) => Eq (Boulevard t a) Source # | |
| (Ord a, Ord t) => Ord (Boulevard t a) Source # | |
| (Show a, Show t) => Show (Boulevard t a) Source # | |
| Generic (Boulevard t a) Source # | |
| (PrettyVal t, PrettyVal a) => PrettyVal (Boulevard t a) Source # | |
| type Rep (Boulevard t a) Source # | |
Constructors
| Suffix'Street (Street t a) | |
| Suffix'Avenue (Avenue t a) | |
| Suffix'Way (Way t a) | |
| Suffix'Boulevard (Boulevard t a) |
Instances
| Bifunctor Suffix Source # | |
| Functor (Suffix t) Source # | |
| Foldable (Suffix t) Source # | |
| Traversable (Suffix t) Source # | |
| (Eq t, Eq a) => Eq (Suffix t a) Source # | |
| (Ord t, Ord a) => Ord (Suffix t a) Source # | |
| (Show t, Show a) => Show (Suffix t a) Source # | |
| Generic (Suffix t a) Source # | |
| (PrettyVal t, PrettyVal a) => PrettyVal (Suffix t a) Source # | |
| type Rep (Suffix t a) Source # | |
data SpaceSuffix t a Source #
Constructors
| SpaceSuffix | |
Fields
| |
Instances
| Bifunctor SpaceSuffix Source # | |
| Functor (SpaceSuffix t) Source # | |
| Foldable (SpaceSuffix t) Source # | |
| Traversable (SpaceSuffix t) Source # | |
| (Eq t, Eq a) => Eq (SpaceSuffix t a) Source # | |
| (Ord t, Ord a) => Ord (SpaceSuffix t a) Source # | |
| (Show t, Show a) => Show (SpaceSuffix t a) Source # | |
| Generic (SpaceSuffix t a) Source # | |
| (PrettyVal t, PrettyVal a) => PrettyVal (SpaceSuffix t a) Source # | |
| type Rep (SpaceSuffix t a) Source # | |
newtype SpaceSuffix'Opt t a Source #
Constructors
| SpaceSuffix'Opt (Maybe (SpaceSuffix t a)) |
Instances
| Bifunctor SpaceSuffix'Opt Source # | |
| Functor (SpaceSuffix'Opt t) Source # | |
| Foldable (SpaceSuffix'Opt t) Source # | |
| Traversable (SpaceSuffix'Opt t) Source # | |
| (Eq a, Eq t) => Eq (SpaceSuffix'Opt t a) Source # | |
| (Ord a, Ord t) => Ord (SpaceSuffix'Opt t a) Source # | |
| (Show a, Show t) => Show (SpaceSuffix'Opt t a) Source # | |
| Generic (SpaceSuffix'Opt t a) Source # | |
| Wrapped (SpaceSuffix'Opt t a) Source # | |
| (PrettyVal t, PrettyVal a) => PrettyVal (SpaceSuffix'Opt t a) Source # | |
| type Rep (SpaceSuffix'Opt t a) Source # | |
| type Unwrapped (SpaceSuffix'Opt t a) Source # | |
data StreetLine t a Source #
Constructors
| StreetLine | |
Fields
| |
Instances
| Bifunctor StreetLine Source # | |
| Functor (StreetLine t) Source # | |
| Foldable (StreetLine t) Source # | |
| Traversable (StreetLine t) Source # | |
| (Eq t, Eq a) => Eq (StreetLine t a) Source # | |
| (Ord t, Ord a) => Ord (StreetLine t a) Source # | |
| (Show t, Show a) => Show (StreetLine t a) Source # | |
| Generic (StreetLine t a) Source # | |
| (PrettyVal t, PrettyVal a) => PrettyVal (StreetLine t a) Source # | |
| type Rep (StreetLine t a) Source # | |
Instances
| Bifunctor City Source # | |
| Functor (City t) Source # | |
| Foldable (City t) Source # | |
| Traversable (City t) Source # | |
| (Eq t, Eq a) => Eq (City t a) Source # | |
| (Ord t, Ord a) => Ord (City t a) Source # | |
| (Show t, Show a) => Show (City t a) Source # | |
| Generic (City t a) Source # | |
| Wrapped (City t a) Source # | |
| (PrettyVal t, PrettyVal a) => PrettyVal (City t a) Source # | |
| type Rep (City t a) Source # | |
| type Unwrapped (City t a) Source # | |
Instances
| Bifunctor State Source # | |
| Functor (State t) Source # | |
| Foldable (State t) Source # | |
| Traversable (State t) Source # | |
| (Eq t, Eq a) => Eq (State t a) Source # | |
| (Ord t, Ord a) => Ord (State t a) Source # | |
| (Show t, Show a) => Show (State t a) Source # | |
| Generic (State t a) Source # | |
| Wrapped (State t a) Source # | |
| (PrettyVal t, PrettyVal a) => PrettyVal (State t a) Source # | |
| type Rep (State t a) Source # | |
| type Unwrapped (State t a) Source # | |
Constructors
| ZipCode | |
Fields
| |
Instances
| Bifunctor ZipCode Source # | |
| Functor (ZipCode t) Source # | |
| Foldable (ZipCode t) Source # | |
| Traversable (ZipCode t) Source # | |
| (Eq t, Eq a) => Eq (ZipCode t a) Source # | |
| (Ord t, Ord a) => Ord (ZipCode t a) Source # | |
| (Show t, Show a) => Show (ZipCode t a) Source # | |
| Generic (ZipCode t a) Source # | |
| (PrettyVal t, PrettyVal a) => PrettyVal (ZipCode t a) Source # | |
| type Rep (ZipCode t a) Source # | |
newtype Newline'Opt t a Source #
Constructors
| Newline'Opt (Maybe (Newline t a)) |
Instances
| Bifunctor Newline'Opt Source # | |
| Functor (Newline'Opt t) Source # | |
| Foldable (Newline'Opt t) Source # | |
| Traversable (Newline'Opt t) Source # | |
| (Eq t, Eq a) => Eq (Newline'Opt t a) Source # | |
| (Ord t, Ord a) => Ord (Newline'Opt t a) Source # | |
| (Show t, Show a) => Show (Newline'Opt t a) Source # | |
| Generic (Newline'Opt t a) Source # | |
| Wrapped (Newline'Opt t a) Source # | |
| (PrettyVal t, PrettyVal a) => PrettyVal (Newline'Opt t a) Source # | |
| type Rep (Newline'Opt t a) Source # | |
| type Unwrapped (Newline'Opt t a) Source # | |
Constructors
| CityLine | |
Fields
| |
Instances
| Bifunctor CityLine Source # | |
| Functor (CityLine t) Source # | |
| Foldable (CityLine t) Source # | |
| Traversable (CityLine t) Source # | |
| (Eq t, Eq a) => Eq (CityLine t a) Source # | |
| (Ord t, Ord a) => Ord (CityLine t a) Source # | |
| (Show t, Show a) => Show (CityLine t a) Source # | |
| Generic (CityLine t a) Source # | |
| (PrettyVal t, PrettyVal a) => PrettyVal (CityLine t a) Source # | |
| type Rep (CityLine t a) Source # | |
Constructors
| Address | |
Fields
| |
Instances
| Bifunctor Address Source # | |
| Functor (Address t) Source # | |
| Foldable (Address t) Source # | |
| Traversable (Address t) Source # | |
| (Eq t, Eq a) => Eq (Address t a) Source # | |
| (Ord t, Ord a) => Ord (Address t a) Source # | |
| (Show t, Show a) => Show (Address t a) Source # | |
| Generic (Address t a) Source # | |
| (PrettyVal t, PrettyVal a) => PrettyVal (Address t a) Source # | |
| type Rep (Address t a) Source # | |