purescript-0.11.7: PureScript Programming Language Compiler

Safe HaskellNone
LanguageHaskell2010

Language.PureScript.TypeClassDictionaries

Synopsis

Documentation

data TypeClassDictionaryInScope v Source #

Data representing a type class dictionary which is in scope

Constructors

TypeClassDictionaryInScope 

Fields

Instances

Functor TypeClassDictionaryInScope Source # 
Foldable TypeClassDictionaryInScope Source # 

Methods

fold :: Monoid m => TypeClassDictionaryInScope m -> m #

foldMap :: Monoid m => (a -> m) -> TypeClassDictionaryInScope a -> m #

foldr :: (a -> b -> b) -> b -> TypeClassDictionaryInScope a -> b #

foldr' :: (a -> b -> b) -> b -> TypeClassDictionaryInScope a -> b #

foldl :: (b -> a -> b) -> b -> TypeClassDictionaryInScope a -> b #

foldl' :: (b -> a -> b) -> b -> TypeClassDictionaryInScope a -> b #

foldr1 :: (a -> a -> a) -> TypeClassDictionaryInScope a -> a #

foldl1 :: (a -> a -> a) -> TypeClassDictionaryInScope a -> a #

toList :: TypeClassDictionaryInScope a -> [a] #

null :: TypeClassDictionaryInScope a -> Bool #

length :: TypeClassDictionaryInScope a -> Int #

elem :: Eq a => a -> TypeClassDictionaryInScope a -> Bool #

maximum :: Ord a => TypeClassDictionaryInScope a -> a #

minimum :: Ord a => TypeClassDictionaryInScope a -> a #

sum :: Num a => TypeClassDictionaryInScope a -> a #

product :: Num a => TypeClassDictionaryInScope a -> a #

Traversable TypeClassDictionaryInScope Source # 
Show v => Show (TypeClassDictionaryInScope v) Source # 
Generic (TypeClassDictionaryInScope v) Source # 
NFData v => NFData (TypeClassDictionaryInScope v) Source # 

Methods

rnf :: TypeClassDictionaryInScope v -> () #

type Rep (TypeClassDictionaryInScope v) Source # 
type Rep (TypeClassDictionaryInScope v) = D1 (MetaData "TypeClassDictionaryInScope" "Language.PureScript.TypeClassDictionaries" "purescript-0.11.7-LYkkdaNPe76o3Ss2KvZX" False) (C1 (MetaCons "TypeClassDictionaryInScope" PrefixI True) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "tcdValue") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 v)) (S1 (MetaSel (Just Symbol "tcdPath") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [(Qualified (ProperName ClassName), Integer)]))) ((:*:) (S1 (MetaSel (Just Symbol "tcdClassName") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Qualified (ProperName ClassName)))) ((:*:) (S1 (MetaSel (Just Symbol "tcdInstanceTypes") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [Type])) (S1 (MetaSel (Just Symbol "tcdDependencies") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [Constraint])))))))

superclassName :: Qualified (ProperName ClassName) -> Integer -> Text Source #

Generate a name for a superclass reference which can be used in generated code.