futhark-0.9.1: An optimising compiler for a functional, array-oriented language.

Safe HaskellNone
LanguageHaskell2010

Futhark.CodeGen.Backends.GenericCSharp.AST

Documentation

data CSInt Source #

Constructors

Int8T 
Int16T 
Int32T 
Int64T 
Instances
Eq CSInt Source # 
Instance details

Defined in Futhark.CodeGen.Backends.GenericCSharp.AST

Methods

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

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

Show CSInt Source # 
Instance details

Defined in Futhark.CodeGen.Backends.GenericCSharp.AST

Methods

showsPrec :: Int -> CSInt -> ShowS #

show :: CSInt -> String #

showList :: [CSInt] -> ShowS #

Pretty CSInt Source # 
Instance details

Defined in Futhark.CodeGen.Backends.GenericCSharp.AST

Methods

ppr :: CSInt -> Doc #

pprPrec :: Int -> CSInt -> Doc #

pprList :: [CSInt] -> Doc #

data CSUInt Source #

Constructors

UInt8T 
UInt16T 
UInt32T 
UInt64T 
Instances
Eq CSUInt Source # 
Instance details

Defined in Futhark.CodeGen.Backends.GenericCSharp.AST

Methods

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

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

Show CSUInt Source # 
Instance details

Defined in Futhark.CodeGen.Backends.GenericCSharp.AST

Pretty CSUInt Source # 
Instance details

Defined in Futhark.CodeGen.Backends.GenericCSharp.AST

Methods

ppr :: CSUInt -> Doc #

pprPrec :: Int -> CSUInt -> Doc #

pprList :: [CSUInt] -> Doc #

data CSFloat Source #

Constructors

FloatT 
DoubleT 

data CSIdx Source #

Instances
Eq CSIdx Source # 
Instance details

Defined in Futhark.CodeGen.Backends.GenericCSharp.AST

Methods

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

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

Show CSIdx Source # 
Instance details

Defined in Futhark.CodeGen.Backends.GenericCSharp.AST

Methods

showsPrec :: Int -> CSIdx -> ShowS #

show :: CSIdx -> String #

showList :: [CSIdx] -> ShowS #

data CSArg Source #

Constructors

ArgKeyword String CSArg 
Arg (Maybe ArgMemType) CSExp 
Instances
Eq CSArg Source # 
Instance details

Defined in Futhark.CodeGen.Backends.GenericCSharp.AST

Methods

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

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

Show CSArg Source # 
Instance details

Defined in Futhark.CodeGen.Backends.GenericCSharp.AST

Methods

showsPrec :: Int -> CSArg -> ShowS #

show :: CSArg -> String #

showList :: [CSArg] -> ShowS #

Pretty CSArg Source # 
Instance details

Defined in Futhark.CodeGen.Backends.GenericCSharp.AST

Methods

ppr :: CSArg -> Doc #

pprPrec :: Int -> CSArg -> Doc #

pprList :: [CSArg] -> Doc #

newtype CSProg Source #

Constructors

CSProg [CSStmt] 
Instances
Eq CSProg Source # 
Instance details

Defined in Futhark.CodeGen.Backends.GenericCSharp.AST

Methods

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

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

Show CSProg Source # 
Instance details

Defined in Futhark.CodeGen.Backends.GenericCSharp.AST

Pretty CSProg Source # 
Instance details

Defined in Futhark.CodeGen.Backends.GenericCSharp.AST

Methods

ppr :: CSProg -> Doc #

pprPrec :: Int -> CSProg -> Doc #

pprList :: [CSProg] -> Doc #