Safe Haskell | Safe |
---|---|
Language | Haskell2010 |
Copilot.Language
Description
Main Copilot language export file.
Synopsis
- data Int8
- data Int16
- data Int32
- data Int64
- module Data.Word
- type Name = String
- class (Show a, Typeable a) => Typed a
- module Copilot.Core.Type
- module Copilot.Core.Type.Array
- impossible :: String -> String -> a
- badUsage :: String -> a
- csv :: Integer -> Spec -> IO ()
- interpret :: Integer -> Spec -> IO ()
- module Copilot.Language.Operators.Boolean
- module Copilot.Language.Operators.Cast
- module Copilot.Language.Operators.Constant
- module Copilot.Language.Operators.Eq
- module Copilot.Language.Operators.Extern
- module Copilot.Language.Operators.Local
- module Copilot.Language.Operators.Label
- module Copilot.Language.Operators.Integral
- module Copilot.Language.Operators.Mux
- module Copilot.Language.Operators.Ord
- module Copilot.Language.Operators.Temporal
- module Copilot.Language.Operators.BitWise
- module Copilot.Language.Operators.Array
- module Copilot.Language.Operators.Struct
- module Copilot.Language.Prelude
- type Spec = Writer [SpecItem] ()
- data Stream :: * -> *
- observer :: Typed a => String -> Stream a -> Spec
- trigger :: String -> Stream Bool -> [Arg] -> Spec
- arg :: Typed a => Stream a -> Arg
- prop :: String -> Prop a -> Writer [SpecItem] (PropRef a)
- theorem :: String -> Prop a -> Proof a -> Writer [SpecItem] (PropRef a)
- forall :: Stream Bool -> Prop Universal
- exists :: Stream Bool -> Prop Existential
- prettyPrint :: Spec -> IO ()
Documentation
8-bit signed integer type
Instances
16-bit signed integer type
Instances
32-bit signed integer type
Instances
64-bit signed integer type
Instances
module Data.Word
class (Show a, Typeable a) => Typed a #
Minimal complete definition
Instances
Typed Bool | |
Defined in Copilot.Core.Type | |
Typed Double | |
Defined in Copilot.Core.Type | |
Typed Float | |
Defined in Copilot.Core.Type | |
Typed Int8 | |
Defined in Copilot.Core.Type | |
Typed Int16 | |
Defined in Copilot.Core.Type | |
Typed Int32 | |
Defined in Copilot.Core.Type | |
Typed Int64 | |
Defined in Copilot.Core.Type | |
Typed Word8 | |
Defined in Copilot.Core.Type | |
Typed Word16 | |
Defined in Copilot.Core.Type | |
Typed Word32 | |
Defined in Copilot.Core.Type | |
Typed Word64 | |
Defined in Copilot.Core.Type | |
(Typeable t, Typed t, KnownNat n, Flatten t (InnerType t), Typed (InnerType t)) => Typed (Array n t) | |
Defined in Copilot.Core.Type |
module Copilot.Core.Type
module Copilot.Core.Type.Array
impossible :: String -> String -> a Source #
module Copilot.Language.Prelude
data Stream :: * -> * Source #
Instances
prettyPrint :: Spec -> IO () Source #