roboservant-0.1.0.3: Automatic session-aware servant testing
Safe HaskellSafe-Inferred
LanguageHaskell2010

Roboservant.Types.Internal

Synopsis

Documentation

data Provenance Source #

Constructors

Provenance SomeTypeRep Int 

Instances

Instances details
Generic Provenance Source # 
Instance details

Defined in Roboservant.Types.Internal

Associated Types

type Rep Provenance :: Type -> Type #

Show Provenance Source # 
Instance details

Defined in Roboservant.Types.Internal

Eq Provenance Source # 
Instance details

Defined in Roboservant.Types.Internal

Hashable Provenance Source # 
Instance details

Defined in Roboservant.Types.Internal

type Rep Provenance Source # 
Instance details

Defined in Roboservant.Types.Internal

type Rep Provenance = D1 ('MetaData "Provenance" "Roboservant.Types.Internal" "roboservant-0.1.0.3-DSuUXjun6GbE6D2WyRVAMJ" 'False) (C1 ('MetaCons "Provenance" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SomeTypeRep) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int)))

data StashValue a Source #

Constructors

StashValue 

Instances

Instances details
Functor StashValue Source # 
Instance details

Defined in Roboservant.Types.Internal

Methods

fmap :: (a -> b) -> StashValue a -> StashValue b #

(<$) :: a -> StashValue b -> StashValue a #

Show a => Show (StashValue a) Source # 
Instance details

Defined in Roboservant.Types.Internal

newtype Stash Source #

Constructors

Stash 

Instances

Instances details
Monoid Stash Source # 
Instance details

Defined in Roboservant.Types.Internal

Methods

mempty :: Stash #

mappend :: Stash -> Stash -> Stash #

mconcat :: [Stash] -> Stash #

Semigroup Stash Source # 
Instance details

Defined in Roboservant.Types.Internal

Methods

(<>) :: Stash -> Stash -> Stash #

sconcat :: NonEmpty Stash -> Stash #

stimes :: Integral b => b -> Stash -> Stash #

Show Stash Source # 
Instance details

Defined in Roboservant.Types.Internal

Methods

showsPrec :: Int -> Stash -> ShowS #

show :: Stash -> String #

showList :: [Stash] -> ShowS #

newtype Atom x Source #

Can't be built up from parts, can't be broken down further.

Constructors

Atom 

Fields

Instances

Instances details
Eq x => Eq (Atom x) Source # 
Instance details

Defined in Roboservant.Types.Internal

Methods

(==) :: Atom x -> Atom x -> Bool #

(/=) :: Atom x -> Atom x -> Bool #

Hashable x => Hashable (Atom x) Source # 
Instance details

Defined in Roboservant.Types.Internal

Methods

hashWithSalt :: Int -> Atom x -> Int #

hash :: Atom x -> Int #

(Hashable x, Typeable x) => Breakdown (Atom x) Source # 
Instance details

Defined in Roboservant.Types.Breakdown

Methods

breakdownExtras :: Atom x -> [(Dynamic, Int)] Source #

(Hashable x, Typeable x) => BuildFrom (Atom x) Source # 
Instance details

Defined in Roboservant.Types.BuildFrom

Methods

extras :: Stash -> [([Provenance], Atom x)] Source #

newtype Compound x Source #

can be broken down and built up from generic pieces

Constructors

Compound 

Fields

Instances

Instances details
Eq x => Eq (Compound x) Source # 
Instance details

Defined in Roboservant.Types.Internal

Methods

(==) :: Compound x -> Compound x -> Bool #

(/=) :: Compound x -> Compound x -> Bool #

Hashable x => Hashable (Compound x) Source # 
Instance details

Defined in Roboservant.Types.Internal

Methods

hashWithSalt :: Int -> Compound x -> Int #

hash :: Compound x -> Int #

(Hashable x, Typeable x, Generic x, GBreakdown (Rep x)) => Breakdown (Compound x) Source # 
Instance details

Defined in Roboservant.Types.Breakdown

(Hashable x, Typeable x, Generic x, GBuildFrom (Rep x)) => BuildFrom (Compound x) Source # 
Instance details

Defined in Roboservant.Types.BuildFrom

Methods

extras :: Stash -> [([Provenance], Compound x)] Source #