clash-lib-1.4.1: Clash: a functional hardware description language - As a library
Copyright(C) 2012-2016 University of Twente
2016 Myrtle Software Ltd
2017 Google Inc.
LicenseBSD2 (see the file LICENSE)
MaintainerChristiaan Baaij <christiaan.baaij@gmail.com>
Safe HaskellNone
LanguageHaskell2010

Clash.Core.Literal

Description

Term Literal

Synopsis

Documentation

data Literal Source #

Term Literal

Instances

Instances details
Eq Literal Source # 
Instance details

Defined in Clash.Core.Literal

Methods

(==) :: Literal -> Literal -> Bool #

(/=) :: Literal -> Literal -> Bool #

Ord Literal Source # 
Instance details

Defined in Clash.Core.Literal

Show Literal Source # 
Instance details

Defined in Clash.Core.Literal

Generic Literal Source # 
Instance details

Defined in Clash.Core.Literal

Associated Types

type Rep Literal :: Type -> Type #

Methods

from :: Literal -> Rep Literal x #

to :: Rep Literal x -> Literal #

Hashable Literal Source # 
Instance details

Defined in Clash.Core.Literal

Methods

hashWithSalt :: Int -> Literal -> Int #

hash :: Literal -> Int #

Binary Literal Source # 
Instance details

Defined in Clash.Core.Literal

Methods

put :: Literal -> Put #

get :: Get Literal #

putList :: [Literal] -> Put #

NFData Literal Source # 
Instance details

Defined in Clash.Core.Literal

Methods

rnf :: Literal -> () #

PrettyPrec Literal Source # 
Instance details

Defined in Clash.Core.Pretty

type Rep Literal Source # 
Instance details

Defined in Clash.Core.Literal

type Rep Literal = D1 ('MetaData "Literal" "Clash.Core.Literal" "clash-lib-1.4.1-inplace" 'False) (((C1 ('MetaCons "IntegerLiteral" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Integer)) :+: C1 ('MetaCons "IntLiteral" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Integer))) :+: (C1 ('MetaCons "WordLiteral" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Integer)) :+: (C1 ('MetaCons "Int64Literal" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Integer)) :+: C1 ('MetaCons "Word64Literal" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Integer))))) :+: ((C1 ('MetaCons "StringLiteral" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 String)) :+: (C1 ('MetaCons "FloatLiteral" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Rational)) :+: C1 ('MetaCons "DoubleLiteral" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Rational)))) :+: (C1 ('MetaCons "CharLiteral" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Char)) :+: (C1 ('MetaCons "NaturalLiteral" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Integer)) :+: C1 ('MetaCons "ByteArrayLiteral" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 ByteArray))))))

literalType :: Literal -> Type Source #

Determines the Type of a Literal