License | BSD-3-Clause |
---|---|
Safe Haskell | None |
Language | Haskell2010 |
Swarm.Language.TDVar
Description
Type definition variables.
Documentation
The name of a user-defined type is represented by a textual name as well as a version number which we can use to differentiate between names which are otherwise the same, when one shadows the other.
See Note [Shadowing for value-level and type-level variables]
Constructors
TDVar | |
Fields
|
Instances
FromJSON TDVar Source # | |||||
Defined in Swarm.Language.TDVar | |||||
FromJSONKey TDVar Source # | |||||
Defined in Swarm.Language.TDVar | |||||
ToJSON TDVar Source # | |||||
ToJSONKey TDVar Source # | |||||
Defined in Swarm.Language.TDVar | |||||
Data TDVar Source # | |||||
Defined in Swarm.Language.TDVar Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TDVar -> c TDVar # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c TDVar # dataTypeOf :: TDVar -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c TDVar) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c TDVar) # gmapT :: (forall b. Data b => b -> b) -> TDVar -> TDVar # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TDVar -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TDVar -> r # gmapQ :: (forall d. Data d => d -> u) -> TDVar -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> TDVar -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> TDVar -> m TDVar # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TDVar -> m TDVar # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TDVar -> m TDVar # | |||||
IsString TDVar Source # | |||||
Defined in Swarm.Language.TDVar Methods fromString :: String -> TDVar # | |||||
Generic TDVar Source # | |||||
Defined in Swarm.Language.TDVar Associated Types
| |||||
Show TDVar Source # | |||||
Eq TDVar Source # | |||||
Ord TDVar Source # | |||||
Hashable TDVar Source # | |||||
Defined in Swarm.Language.TDVar | |||||
PrettyPrec TDVar Source # | The | ||||
Defined in Swarm.Language.TDVar Methods prettyPrec :: Int -> TDVar -> Doc ann | |||||
type Rep TDVar Source # | |||||
Defined in Swarm.Language.TDVar type Rep TDVar = D1 ('MetaData "TDVar" "Swarm.Language.TDVar" "swarm-0.7.0.0-IuFfgHrMoE7JrptOBRVOwx-swarm-lang" 'False) (C1 ('MetaCons "TDVar" 'PrefixI 'True) (S1 ('MetaSel ('Just "tdVarName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Text) :*: S1 ('MetaSel ('Just "tdVarVersion") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Int))) |
mkTDVar :: Text -> TDVar Source #
Create a type definition variable with the given name and a default version of 0.