posable-1.0.0.0: A product-of-sums generics library
Safe HaskellNone
LanguageHaskell2010

Generics.POSable.Instances

Description

This module contains instances of POSable for all Haskell prelude data types as well as fixed size integers from Data.Int (Int8, Int16, Int32 and Int64)

Synopsis

Documentation

class KnownNat (Choices x) => POSable x Source #

POSable, the base of this library. Provide a compact memory representation for a type and a function to get back to the original type. This memory representation consist of choices, that represent all constructor choices in the type in a single Finite integer, and fields which represents all values in the type as a Product of Sums, which can be mapped to a struct-of-arrays representation for use in array-based languages like Accelerate.

Instances

Instances details
POSable Bool Source # 
Instance details

Defined in Generics.POSable.Instances

Associated Types

type Choices Bool :: Nat Source #

type Fields Bool :: [[Type]] Source #

POSable Double Source # 
Instance details

Defined in Examples

Associated Types

type Choices Double :: Nat Source #

type Fields Double :: [[Type]] Source #

POSable Float Source # 
Instance details

Defined in Examples

Associated Types

type Choices Float :: Nat Source #

type Fields Float :: [[Type]] Source #

POSable Ordering Source # 
Instance details

Defined in Generics.POSable.Instances

Associated Types

type Choices Ordering :: Nat Source #

type Fields Ordering :: [[Type]] Source #

POSable () Source # 
Instance details

Defined in Generics.POSable.Instances

Associated Types

type Choices () :: Nat Source #

type Fields () :: [[Type]] Source #

POSable Undef Source # 
Instance details

Defined in Generics.POSable.Instances

Associated Types

type Choices Undef :: Nat Source #

type Fields Undef :: [[Type]] Source #

POSable x => POSable (Maybe x) Source # 
Instance details

Defined in Generics.POSable.Instances

Associated Types

type Choices (Maybe x) :: Nat Source #

type Fields (Maybe x) :: [[Type]] Source #

(POSable l, POSable r) => POSable (Either l r) Source # 
Instance details

Defined in Generics.POSable.Instances

Associated Types

type Choices (Either l r) :: Nat Source #

type Fields (Either l r) :: [[Type]] Source #

(POSable x0, POSable x1) => POSable (x0, x1) Source # 
Instance details

Defined in Generics.POSable.Instances

Associated Types

type Choices (x0, x1) :: Nat Source #

type Fields (x0, x1) :: [[Type]] Source #

Methods

choices :: (x0, x1) -> Finite (Choices (x0, x1)) Source #

tags :: [Integer] Source #

fromPOSable :: Finite (Choices (x0, x1)) -> Product (Fields (x0, x1)) -> (x0, x1) Source #

fields :: (x0, x1) -> Product (Fields (x0, x1)) Source #

emptyFields :: ProductType (Fields (x0, x1)) Source #

(POSable x0, POSable x1, POSable x2) => POSable (x0, x1, x2) Source # 
Instance details

Defined in Generics.POSable.Instances

Associated Types

type Choices (x0, x1, x2) :: Nat Source #

type Fields (x0, x1, x2) :: [[Type]] Source #

Methods

choices :: (x0, x1, x2) -> Finite (Choices (x0, x1, x2)) Source #

tags :: [Integer] Source #

fromPOSable :: Finite (Choices (x0, x1, x2)) -> Product (Fields (x0, x1, x2)) -> (x0, x1, x2) Source #

fields :: (x0, x1, x2) -> Product (Fields (x0, x1, x2)) Source #

emptyFields :: ProductType (Fields (x0, x1, x2)) Source #

(POSable x0, POSable x1, POSable x2, POSable x3) => POSable (x0, x1, x2, x3) Source # 
Instance details

Defined in Generics.POSable.Instances

Associated Types

type Choices (x0, x1, x2, x3) :: Nat Source #

type Fields (x0, x1, x2, x3) :: [[Type]] Source #

Methods

choices :: (x0, x1, x2, x3) -> Finite (Choices (x0, x1, x2, x3)) Source #

tags :: [Integer] Source #

fromPOSable :: Finite (Choices (x0, x1, x2, x3)) -> Product (Fields (x0, x1, x2, x3)) -> (x0, x1, x2, x3) Source #

fields :: (x0, x1, x2, x3) -> Product (Fields (x0, x1, x2, x3)) Source #

emptyFields :: ProductType (Fields (x0, x1, x2, x3)) Source #

(POSable x0, POSable x1, POSable x2, POSable x3, POSable x4) => POSable (x0, x1, x2, x3, x4) Source # 
Instance details

Defined in Generics.POSable.Instances

Associated Types

type Choices (x0, x1, x2, x3, x4) :: Nat Source #

type Fields (x0, x1, x2, x3, x4) :: [[Type]] Source #

Methods

choices :: (x0, x1, x2, x3, x4) -> Finite (Choices (x0, x1, x2, x3, x4)) Source #

tags :: [Integer] Source #

fromPOSable :: Finite (Choices (x0, x1, x2, x3, x4)) -> Product (Fields (x0, x1, x2, x3, x4)) -> (x0, x1, x2, x3, x4) Source #

fields :: (x0, x1, x2, x3, x4) -> Product (Fields (x0, x1, x2, x3, x4)) Source #

emptyFields :: ProductType (Fields (x0, x1, x2, x3, x4)) Source #

(POSable x0, POSable x1, POSable x2, POSable x3, POSable x4, POSable x5) => POSable (x0, x1, x2, x3, x4, x5) Source # 
Instance details

Defined in Generics.POSable.Instances

Associated Types

type Choices (x0, x1, x2, x3, x4, x5) :: Nat Source #

type Fields (x0, x1, x2, x3, x4, x5) :: [[Type]] Source #

Methods

choices :: (x0, x1, x2, x3, x4, x5) -> Finite (Choices (x0, x1, x2, x3, x4, x5)) Source #

tags :: [Integer] Source #

fromPOSable :: Finite (Choices (x0, x1, x2, x3, x4, x5)) -> Product (Fields (x0, x1, x2, x3, x4, x5)) -> (x0, x1, x2, x3, x4, x5) Source #

fields :: (x0, x1, x2, x3, x4, x5) -> Product (Fields (x0, x1, x2, x3, x4, x5)) Source #

emptyFields :: ProductType (Fields (x0, x1, x2, x3, x4, x5)) Source #

(POSable x0, POSable x1, POSable x2, POSable x3, POSable x4, POSable x5, POSable x6) => POSable (x0, x1, x2, x3, x4, x5, x6) Source # 
Instance details

Defined in Generics.POSable.Instances

Associated Types

type Choices (x0, x1, x2, x3, x4, x5, x6) :: Nat Source #

type Fields (x0, x1, x2, x3, x4, x5, x6) :: [[Type]] Source #

Methods

choices :: (x0, x1, x2, x3, x4, x5, x6) -> Finite (Choices (x0, x1, x2, x3, x4, x5, x6)) Source #

tags :: [Integer] Source #

fromPOSable :: Finite (Choices (x0, x1, x2, x3, x4, x5, x6)) -> Product (Fields (x0, x1, x2, x3, x4, x5, x6)) -> (x0, x1, x2, x3, x4, x5, x6) Source #

fields :: (x0, x1, x2, x3, x4, x5, x6) -> Product (Fields (x0, x1, x2, x3, x4, x5, x6)) Source #

emptyFields :: ProductType (Fields (x0, x1, x2, x3, x4, x5, x6)) Source #

(POSable x0, POSable x1, POSable x2, POSable x3, POSable x4, POSable x5, POSable x6, POSable x7) => POSable (x0, x1, x2, x3, x4, x5, x6, x7) Source # 
Instance details

Defined in Generics.POSable.Instances

Associated Types

type Choices (x0, x1, x2, x3, x4, x5, x6, x7) :: Nat Source #

type Fields (x0, x1, x2, x3, x4, x5, x6, x7) :: [[Type]] Source #

Methods

choices :: (x0, x1, x2, x3, x4, x5, x6, x7) -> Finite (Choices (x0, x1, x2, x3, x4, x5, x6, x7)) Source #

tags :: [Integer] Source #

fromPOSable :: Finite (Choices (x0, x1, x2, x3, x4, x5, x6, x7)) -> Product (Fields (x0, x1, x2, x3, x4, x5, x6, x7)) -> (x0, x1, x2, x3, x4, x5, x6, x7) Source #

fields :: (x0, x1, x2, x3, x4, x5, x6, x7) -> Product (Fields (x0, x1, x2, x3, x4, x5, x6, x7)) Source #

emptyFields :: ProductType (Fields (x0, x1, x2, x3, x4, x5, x6, x7)) Source #

(POSable x0, POSable x1, POSable x2, POSable x3, POSable x4, POSable x5, POSable x6, POSable x7, POSable x8) => POSable (x0, x1, x2, x3, x4, x5, x6, x7, x8) Source # 
Instance details

Defined in Generics.POSable.Instances

Associated Types

type Choices (x0, x1, x2, x3, x4, x5, x6, x7, x8) :: Nat Source #

type Fields (x0, x1, x2, x3, x4, x5, x6, x7, x8) :: [[Type]] Source #

Methods

choices :: (x0, x1, x2, x3, x4, x5, x6, x7, x8) -> Finite (Choices (x0, x1, x2, x3, x4, x5, x6, x7, x8)) Source #

tags :: [Integer] Source #

fromPOSable :: Finite (Choices (x0, x1, x2, x3, x4, x5, x6, x7, x8)) -> Product (Fields (x0, x1, x2, x3, x4, x5, x6, x7, x8)) -> (x0, x1, x2, x3, x4, x5, x6, x7, x8) Source #

fields :: (x0, x1, x2, x3, x4, x5, x6, x7, x8) -> Product (Fields (x0, x1, x2, x3, x4, x5, x6, x7, x8)) Source #

emptyFields :: ProductType (Fields (x0, x1, x2, x3, x4, x5, x6, x7, x8)) Source #

(POSable x0, POSable x1, POSable x2, POSable x3, POSable x4, POSable x5, POSable x6, POSable x7, POSable x8, POSable x9) => POSable (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9) Source # 
Instance details

Defined in Generics.POSable.Instances

Associated Types

type Choices (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9) :: Nat Source #

type Fields (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9) :: [[Type]] Source #

Methods

choices :: (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9) -> Finite (Choices (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9)) Source #

tags :: [Integer] Source #

fromPOSable :: Finite (Choices (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9)) -> Product (Fields (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9)) -> (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9) Source #

fields :: (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9) -> Product (Fields (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9)) Source #

emptyFields :: ProductType (Fields (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9)) Source #

(POSable x0, POSable x1, POSable x2, POSable x3, POSable x4, POSable x5, POSable x6, POSable x7, POSable x8, POSable x9, POSable x10) => POSable (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10) Source # 
Instance details

Defined in Generics.POSable.Instances

Associated Types

type Choices (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10) :: Nat Source #

type Fields (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10) :: [[Type]] Source #

Methods

choices :: (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10) -> Finite (Choices (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10)) Source #

tags :: [Integer] Source #

fromPOSable :: Finite (Choices (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10)) -> Product (Fields (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10)) -> (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10) Source #

fields :: (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10) -> Product (Fields (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10)) Source #

emptyFields :: ProductType (Fields (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10)) Source #

(POSable x0, POSable x1, POSable x2, POSable x3, POSable x4, POSable x5, POSable x6, POSable x7, POSable x8, POSable x9, POSable x10, POSable x11) => POSable (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11) Source # 
Instance details

Defined in Generics.POSable.Instances

Associated Types

type Choices (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11) :: Nat Source #

type Fields (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11) :: [[Type]] Source #

Methods

choices :: (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11) -> Finite (Choices (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11)) Source #

tags :: [Integer] Source #

fromPOSable :: Finite (Choices (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11)) -> Product (Fields (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11)) -> (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11) Source #

fields :: (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11) -> Product (Fields (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11)) Source #

emptyFields :: ProductType (Fields (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11)) Source #

(POSable x0, POSable x1, POSable x2, POSable x3, POSable x4, POSable x5, POSable x6, POSable x7, POSable x8, POSable x9, POSable x10, POSable x11, POSable x12) => POSable (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12) Source # 
Instance details

Defined in Generics.POSable.Instances

Associated Types

type Choices (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12) :: Nat Source #

type Fields (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12) :: [[Type]] Source #

Methods

choices :: (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12) -> Finite (Choices (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12)) Source #

tags :: [Integer] Source #

fromPOSable :: Finite (Choices (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12)) -> Product (Fields (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12)) -> (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12) Source #

fields :: (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12) -> Product (Fields (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12)) Source #

emptyFields :: ProductType (Fields (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12)) Source #

(POSable x0, POSable x1, POSable x2, POSable x3, POSable x4, POSable x5, POSable x6, POSable x7, POSable x8, POSable x9, POSable x10, POSable x11, POSable x12, POSable x13) => POSable (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12, x13) Source # 
Instance details

Defined in Generics.POSable.Instances

Associated Types

type Choices (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12, x13) :: Nat Source #

type Fields (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12, x13) :: [[Type]] Source #

Methods

choices :: (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12, x13) -> Finite (Choices (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12, x13)) Source #

tags :: [Integer] Source #

fromPOSable :: Finite (Choices (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12, x13)) -> Product (Fields (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12, x13)) -> (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12, x13) Source #

fields :: (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12, x13) -> Product (Fields (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12, x13)) Source #

emptyFields :: ProductType (Fields (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12, x13)) Source #

(POSable x0, POSable x1, POSable x2, POSable x3, POSable x4, POSable x5, POSable x6, POSable x7, POSable x8, POSable x9, POSable x10, POSable x11, POSable x12, POSable x13, POSable x14) => POSable (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12, x13, x14) Source # 
Instance details

Defined in Generics.POSable.Instances

Associated Types

type Choices (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12, x13, x14) :: Nat Source #

type Fields (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12, x13, x14) :: [[Type]] Source #

Methods

choices :: (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12, x13, x14) -> Finite (Choices (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12, x13, x14)) Source #

tags :: [Integer] Source #

fromPOSable :: Finite (Choices (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12, x13, x14)) -> Product (Fields (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12, x13, x14)) -> (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12, x13, x14) Source #

fields :: (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12, x13, x14) -> Product (Fields (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12, x13, x14)) Source #

emptyFields :: ProductType (Fields (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12, x13, x14)) Source #

(POSable x0, POSable x1, POSable x2, POSable x3, POSable x4, POSable x5, POSable x6, POSable x7, POSable x8, POSable x9, POSable x10, POSable x11, POSable x12, POSable x13, POSable x14, POSable x15) => POSable (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12, x13, x14, x15) Source # 
Instance details

Defined in Generics.POSable.Instances

Associated Types

type Choices (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12, x13, x14, x15) :: Nat Source #

type Fields (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12, x13, x14, x15) :: [[Type]] Source #

Methods

choices :: (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12, x13, x14, x15) -> Finite (Choices (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12, x13, x14, x15)) Source #

tags :: [Integer] Source #

fromPOSable :: Finite (Choices (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12, x13, x14, x15)) -> Product (Fields (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12, x13, x14, x15)) -> (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12, x13, x14, x15) Source #

fields :: (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12, x13, x14, x15) -> Product (Fields (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12, x13, x14, x15)) Source #

emptyFields :: ProductType (Fields (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12, x13, x14, x15)) Source #

Orphan instances

POSable Bool Source # 
Instance details

Associated Types

type Choices Bool :: Nat Source #

type Fields Bool :: [[Type]] Source #

POSable Ordering Source # 
Instance details

Associated Types

type Choices Ordering :: Nat Source #

type Fields Ordering :: [[Type]] Source #

POSable () Source # 
Instance details

Associated Types

type Choices () :: Nat Source #

type Fields () :: [[Type]] Source #

POSable Undef Source # 
Instance details

Associated Types

type Choices Undef :: Nat Source #

type Fields Undef :: [[Type]] Source #

POSable x => POSable (Maybe x) Source # 
Instance details

Associated Types

type Choices (Maybe x) :: Nat Source #

type Fields (Maybe x) :: [[Type]] Source #

(POSable l, POSable r) => POSable (Either l r) Source # 
Instance details

Associated Types

type Choices (Either l r) :: Nat Source #

type Fields (Either l r) :: [[Type]] Source #

(POSable x0, POSable x1) => POSable (x0, x1) Source # 
Instance details

Associated Types

type Choices (x0, x1) :: Nat Source #

type Fields (x0, x1) :: [[Type]] Source #

Methods

choices :: (x0, x1) -> Finite (Choices (x0, x1)) Source #

tags :: [Integer] Source #

fromPOSable :: Finite (Choices (x0, x1)) -> Product (Fields (x0, x1)) -> (x0, x1) Source #

fields :: (x0, x1) -> Product (Fields (x0, x1)) Source #

emptyFields :: ProductType (Fields (x0, x1)) Source #

(POSable x0, POSable x1, POSable x2) => POSable (x0, x1, x2) Source # 
Instance details

Associated Types

type Choices (x0, x1, x2) :: Nat Source #

type Fields (x0, x1, x2) :: [[Type]] Source #

Methods

choices :: (x0, x1, x2) -> Finite (Choices (x0, x1, x2)) Source #

tags :: [Integer] Source #

fromPOSable :: Finite (Choices (x0, x1, x2)) -> Product (Fields (x0, x1, x2)) -> (x0, x1, x2) Source #

fields :: (x0, x1, x2) -> Product (Fields (x0, x1, x2)) Source #

emptyFields :: ProductType (Fields (x0, x1, x2)) Source #

(POSable x0, POSable x1, POSable x2, POSable x3) => POSable (x0, x1, x2, x3) Source # 
Instance details

Associated Types

type Choices (x0, x1, x2, x3) :: Nat Source #

type Fields (x0, x1, x2, x3) :: [[Type]] Source #

Methods

choices :: (x0, x1, x2, x3) -> Finite (Choices (x0, x1, x2, x3)) Source #

tags :: [Integer] Source #

fromPOSable :: Finite (Choices (x0, x1, x2, x3)) -> Product (Fields (x0, x1, x2, x3)) -> (x0, x1, x2, x3) Source #

fields :: (x0, x1, x2, x3) -> Product (Fields (x0, x1, x2, x3)) Source #

emptyFields :: ProductType (Fields (x0, x1, x2, x3)) Source #

(POSable x0, POSable x1, POSable x2, POSable x3, POSable x4) => POSable (x0, x1, x2, x3, x4) Source # 
Instance details

Associated Types

type Choices (x0, x1, x2, x3, x4) :: Nat Source #

type Fields (x0, x1, x2, x3, x4) :: [[Type]] Source #

Methods

choices :: (x0, x1, x2, x3, x4) -> Finite (Choices (x0, x1, x2, x3, x4)) Source #

tags :: [Integer] Source #

fromPOSable :: Finite (Choices (x0, x1, x2, x3, x4)) -> Product (Fields (x0, x1, x2, x3, x4)) -> (x0, x1, x2, x3, x4) Source #

fields :: (x0, x1, x2, x3, x4) -> Product (Fields (x0, x1, x2, x3, x4)) Source #

emptyFields :: ProductType (Fields (x0, x1, x2, x3, x4)) Source #

(POSable x0, POSable x1, POSable x2, POSable x3, POSable x4, POSable x5) => POSable (x0, x1, x2, x3, x4, x5) Source # 
Instance details

Associated Types

type Choices (x0, x1, x2, x3, x4, x5) :: Nat Source #

type Fields (x0, x1, x2, x3, x4, x5) :: [[Type]] Source #

Methods

choices :: (x0, x1, x2, x3, x4, x5) -> Finite (Choices (x0, x1, x2, x3, x4, x5)) Source #

tags :: [Integer] Source #

fromPOSable :: Finite (Choices (x0, x1, x2, x3, x4, x5)) -> Product (Fields (x0, x1, x2, x3, x4, x5)) -> (x0, x1, x2, x3, x4, x5) Source #

fields :: (x0, x1, x2, x3, x4, x5) -> Product (Fields (x0, x1, x2, x3, x4, x5)) Source #

emptyFields :: ProductType (Fields (x0, x1, x2, x3, x4, x5)) Source #

(POSable x0, POSable x1, POSable x2, POSable x3, POSable x4, POSable x5, POSable x6) => POSable (x0, x1, x2, x3, x4, x5, x6) Source # 
Instance details

Associated Types

type Choices (x0, x1, x2, x3, x4, x5, x6) :: Nat Source #

type Fields (x0, x1, x2, x3, x4, x5, x6) :: [[Type]] Source #

Methods

choices :: (x0, x1, x2, x3, x4, x5, x6) -> Finite (Choices (x0, x1, x2, x3, x4, x5, x6)) Source #

tags :: [Integer] Source #

fromPOSable :: Finite (Choices (x0, x1, x2, x3, x4, x5, x6)) -> Product (Fields (x0, x1, x2, x3, x4, x5, x6)) -> (x0, x1, x2, x3, x4, x5, x6) Source #

fields :: (x0, x1, x2, x3, x4, x5, x6) -> Product (Fields (x0, x1, x2, x3, x4, x5, x6)) Source #

emptyFields :: ProductType (Fields (x0, x1, x2, x3, x4, x5, x6)) Source #

(POSable x0, POSable x1, POSable x2, POSable x3, POSable x4, POSable x5, POSable x6, POSable x7) => POSable (x0, x1, x2, x3, x4, x5, x6, x7) Source # 
Instance details

Associated Types

type Choices (x0, x1, x2, x3, x4, x5, x6, x7) :: Nat Source #

type Fields (x0, x1, x2, x3, x4, x5, x6, x7) :: [[Type]] Source #

Methods

choices :: (x0, x1, x2, x3, x4, x5, x6, x7) -> Finite (Choices (x0, x1, x2, x3, x4, x5, x6, x7)) Source #

tags :: [Integer] Source #

fromPOSable :: Finite (Choices (x0, x1, x2, x3, x4, x5, x6, x7)) -> Product (Fields (x0, x1, x2, x3, x4, x5, x6, x7)) -> (x0, x1, x2, x3, x4, x5, x6, x7) Source #

fields :: (x0, x1, x2, x3, x4, x5, x6, x7) -> Product (Fields (x0, x1, x2, x3, x4, x5, x6, x7)) Source #

emptyFields :: ProductType (Fields (x0, x1, x2, x3, x4, x5, x6, x7)) Source #

(POSable x0, POSable x1, POSable x2, POSable x3, POSable x4, POSable x5, POSable x6, POSable x7, POSable x8) => POSable (x0, x1, x2, x3, x4, x5, x6, x7, x8) Source # 
Instance details

Associated Types

type Choices (x0, x1, x2, x3, x4, x5, x6, x7, x8) :: Nat Source #

type Fields (x0, x1, x2, x3, x4, x5, x6, x7, x8) :: [[Type]] Source #

Methods

choices :: (x0, x1, x2, x3, x4, x5, x6, x7, x8) -> Finite (Choices (x0, x1, x2, x3, x4, x5, x6, x7, x8)) Source #

tags :: [Integer] Source #

fromPOSable :: Finite (Choices (x0, x1, x2, x3, x4, x5, x6, x7, x8)) -> Product (Fields (x0, x1, x2, x3, x4, x5, x6, x7, x8)) -> (x0, x1, x2, x3, x4, x5, x6, x7, x8) Source #

fields :: (x0, x1, x2, x3, x4, x5, x6, x7, x8) -> Product (Fields (x0, x1, x2, x3, x4, x5, x6, x7, x8)) Source #

emptyFields :: ProductType (Fields (x0, x1, x2, x3, x4, x5, x6, x7, x8)) Source #

(POSable x0, POSable x1, POSable x2, POSable x3, POSable x4, POSable x5, POSable x6, POSable x7, POSable x8, POSable x9) => POSable (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9) Source # 
Instance details

Associated Types

type Choices (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9) :: Nat Source #

type Fields (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9) :: [[Type]] Source #

Methods

choices :: (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9) -> Finite (Choices (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9)) Source #

tags :: [Integer] Source #

fromPOSable :: Finite (Choices (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9)) -> Product (Fields (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9)) -> (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9) Source #

fields :: (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9) -> Product (Fields (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9)) Source #

emptyFields :: ProductType (Fields (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9)) Source #

(POSable x0, POSable x1, POSable x2, POSable x3, POSable x4, POSable x5, POSable x6, POSable x7, POSable x8, POSable x9, POSable x10) => POSable (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10) Source # 
Instance details

Associated Types

type Choices (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10) :: Nat Source #

type Fields (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10) :: [[Type]] Source #

Methods

choices :: (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10) -> Finite (Choices (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10)) Source #

tags :: [Integer] Source #

fromPOSable :: Finite (Choices (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10)) -> Product (Fields (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10)) -> (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10) Source #

fields :: (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10) -> Product (Fields (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10)) Source #

emptyFields :: ProductType (Fields (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10)) Source #

(POSable x0, POSable x1, POSable x2, POSable x3, POSable x4, POSable x5, POSable x6, POSable x7, POSable x8, POSable x9, POSable x10, POSable x11) => POSable (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11) Source # 
Instance details

Associated Types

type Choices (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11) :: Nat Source #

type Fields (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11) :: [[Type]] Source #

Methods

choices :: (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11) -> Finite (Choices (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11)) Source #

tags :: [Integer] Source #

fromPOSable :: Finite (Choices (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11)) -> Product (Fields (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11)) -> (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11) Source #

fields :: (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11) -> Product (Fields (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11)) Source #

emptyFields :: ProductType (Fields (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11)) Source #

(POSable x0, POSable x1, POSable x2, POSable x3, POSable x4, POSable x5, POSable x6, POSable x7, POSable x8, POSable x9, POSable x10, POSable x11, POSable x12) => POSable (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12) Source # 
Instance details

Associated Types

type Choices (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12) :: Nat Source #

type Fields (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12) :: [[Type]] Source #

Methods

choices :: (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12) -> Finite (Choices (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12)) Source #

tags :: [Integer] Source #

fromPOSable :: Finite (Choices (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12)) -> Product (Fields (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12)) -> (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12) Source #

fields :: (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12) -> Product (Fields (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12)) Source #

emptyFields :: ProductType (Fields (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12)) Source #

(POSable x0, POSable x1, POSable x2, POSable x3, POSable x4, POSable x5, POSable x6, POSable x7, POSable x8, POSable x9, POSable x10, POSable x11, POSable x12, POSable x13) => POSable (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12, x13) Source # 
Instance details

Associated Types

type Choices (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12, x13) :: Nat Source #

type Fields (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12, x13) :: [[Type]] Source #

Methods

choices :: (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12, x13) -> Finite (Choices (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12, x13)) Source #

tags :: [Integer] Source #

fromPOSable :: Finite (Choices (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12, x13)) -> Product (Fields (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12, x13)) -> (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12, x13) Source #

fields :: (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12, x13) -> Product (Fields (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12, x13)) Source #

emptyFields :: ProductType (Fields (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12, x13)) Source #

(POSable x0, POSable x1, POSable x2, POSable x3, POSable x4, POSable x5, POSable x6, POSable x7, POSable x8, POSable x9, POSable x10, POSable x11, POSable x12, POSable x13, POSable x14) => POSable (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12, x13, x14) Source # 
Instance details

Associated Types

type Choices (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12, x13, x14) :: Nat Source #

type Fields (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12, x13, x14) :: [[Type]] Source #

Methods

choices :: (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12, x13, x14) -> Finite (Choices (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12, x13, x14)) Source #

tags :: [Integer] Source #

fromPOSable :: Finite (Choices (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12, x13, x14)) -> Product (Fields (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12, x13, x14)) -> (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12, x13, x14) Source #

fields :: (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12, x13, x14) -> Product (Fields (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12, x13, x14)) Source #

emptyFields :: ProductType (Fields (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12, x13, x14)) Source #

(POSable x0, POSable x1, POSable x2, POSable x3, POSable x4, POSable x5, POSable x6, POSable x7, POSable x8, POSable x9, POSable x10, POSable x11, POSable x12, POSable x13, POSable x14, POSable x15) => POSable (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12, x13, x14, x15) Source # 
Instance details

Associated Types

type Choices (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12, x13, x14, x15) :: Nat Source #

type Fields (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12, x13, x14, x15) :: [[Type]] Source #

Methods

choices :: (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12, x13, x14, x15) -> Finite (Choices (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12, x13, x14, x15)) Source #

tags :: [Integer] Source #

fromPOSable :: Finite (Choices (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12, x13, x14, x15)) -> Product (Fields (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12, x13, x14, x15)) -> (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12, x13, x14, x15) Source #

fields :: (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12, x13, x14, x15) -> Product (Fields (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12, x13, x14, x15)) Source #

emptyFields :: ProductType (Fields (x0, x1, x2, x3, x4, x5, x6, x7, x8, x9, x10, x11, x12, x13, x14, x15)) Source #