futhark-0.15.5: An optimising compiler for a functional, array-oriented language.
Safe HaskellNone
LanguageHaskell2010

Futhark.CodeGen.Backends.GenericCSharp.AST

Documentation

data CSType Source #

Instances

Instances details
Eq CSType Source # 
Instance details

Defined in Futhark.CodeGen.Backends.GenericCSharp.AST

Methods

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

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

Show CSType Source # 
Instance details

Defined in Futhark.CodeGen.Backends.GenericCSharp.AST

Pretty CSType Source # 
Instance details

Defined in Futhark.CodeGen.Backends.GenericCSharp.AST

Methods

ppr :: CSType -> Doc

pprPrec :: Int -> CSType -> Doc

pprList :: [CSType] -> Doc

data CSComp Source #

Instances

Instances details
Eq CSComp Source # 
Instance details

Defined in Futhark.CodeGen.Backends.GenericCSharp.AST

Methods

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

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

Show CSComp Source # 
Instance details

Defined in Futhark.CodeGen.Backends.GenericCSharp.AST

Pretty CSComp Source # 
Instance details

Defined in Futhark.CodeGen.Backends.GenericCSharp.AST

Methods

ppr :: CSComp -> Doc

pprPrec :: Int -> CSComp -> Doc

pprList :: [CSComp] -> Doc

data CSPrim Source #

Instances

Instances details
Eq CSPrim Source # 
Instance details

Defined in Futhark.CodeGen.Backends.GenericCSharp.AST

Methods

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

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

Show CSPrim Source # 
Instance details

Defined in Futhark.CodeGen.Backends.GenericCSharp.AST

Pretty CSPrim Source # 
Instance details

Defined in Futhark.CodeGen.Backends.GenericCSharp.AST

Methods

ppr :: CSPrim -> Doc

pprPrec :: Int -> CSPrim -> Doc

pprList :: [CSPrim] -> Doc

data CSInt Source #

Constructors

Int8T 
Int16T 
Int32T 
Int64T 

Instances

Instances details
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

Instances details
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 

Instances

Instances details
Eq CSFloat Source # 
Instance details

Defined in Futhark.CodeGen.Backends.GenericCSharp.AST

Methods

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

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

Show CSFloat Source # 
Instance details

Defined in Futhark.CodeGen.Backends.GenericCSharp.AST

Pretty CSFloat Source # 
Instance details

Defined in Futhark.CodeGen.Backends.GenericCSharp.AST

Methods

ppr :: CSFloat -> Doc

pprPrec :: Int -> CSFloat -> Doc

pprList :: [CSFloat] -> Doc

data CSIdx Source #

Instances

Instances details
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 #

Instances

Instances details
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

Instances details
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

data CSExcept Source #

Constructors

Catch CSExp [CSStmt] 

Instances

Instances details
Eq CSExcept Source # 
Instance details

Defined in Futhark.CodeGen.Backends.GenericCSharp.AST

Show CSExcept Source # 
Instance details

Defined in Futhark.CodeGen.Backends.GenericCSharp.AST

Pretty CSExcept Source # 
Instance details

Defined in Futhark.CodeGen.Backends.GenericCSharp.AST

Methods

ppr :: CSExcept -> Doc

pprPrec :: Int -> CSExcept -> Doc

pprList :: [CSExcept] -> Doc

data CSFunDef Source #

Constructors

Def String CSType [CSFunDefArg] [CSStmt] 

Instances

Instances details
Eq CSFunDef Source # 
Instance details

Defined in Futhark.CodeGen.Backends.GenericCSharp.AST

Show CSFunDef Source # 
Instance details

Defined in Futhark.CodeGen.Backends.GenericCSharp.AST

Pretty CSFunDef Source # 
Instance details

Defined in Futhark.CodeGen.Backends.GenericCSharp.AST

Methods

ppr :: CSFunDef -> Doc

pprPrec :: Int -> CSFunDef -> Doc

pprList :: [CSFunDef] -> Doc