language-objc-0.4.2.2: Analysis and generation of Objective C code

Portabilityghc
Stabilityexperimental
Maintainer[email protected]
Safe HaskellNone

Language.ObjC.Syntax.Constants

Contents

Description

This module provides support for representing, checking and exporting c constants, i.e. integral, float, character and string constants.

Synopsis

Utilities

newtype Flags f Source

Constructors

Flags Integer 

Instances

Typeable1 Flags 
Eq (Flags f) 
Data f => Data (Flags f) 
Ord (Flags f) 

setFlag :: Enum f => f -> Flags f -> Flags fSource

clearFlag :: Enum f => f -> Flags f -> Flags fSource

testFlag :: Enum f => f -> Flags f -> BoolSource

C char constants (and multi-character character constants)

cChar :: Char -> CCharSource

construct a character constant from a haskell Char Use cchar_w if you want a wide character constant.

cChar_w :: Char -> CCharSource

construct a wide chararacter constant

cChars :: [Char] -> Bool -> CCharSource

create a multi-character character constant

data CChar Source

C char constants (abstract)

Constructors

CChar !Char !Bool 
CChars [Char] !Bool 

getCChar :: CChar -> [Char]Source

get the haskell representation of a char constant

getCCharAsInt :: CChar -> IntegerSource

get integer value of a C char constant undefined result for multi-char char constants

isWideChar :: CChar -> BoolSource

return true if the character constant is wide.

showCharConst :: Char -> ShowSSource

showCharConst c prepends _a_ String representing the C char constant corresponding to c. If necessary uses octal or hexadecimal escape sequences.

C integral constants

data CIntFlag Source

datatype representing type flags for integers

data CIntRepr Source

datatype for memorizing the representation of an integer

Constructors

DecRepr 
HexRepr 
OctalRepr 

cInteger :: Integer -> CIntegerSource

construct a integer constant (without type flags) from a haskell integer

C floating point constants

data CFloat Source

Floats (represented as strings)

Constructors

CFloat !String 

C string literals

data CString Source

C String literals

Constructors

CString [Char] Bool 

showStringLit :: String -> ShowSSource

showStringLiteral s prepends a String representing the C string literal corresponding to s. If necessary it uses octal or hexadecimal escape sequences.

concatCStrings :: [CString] -> CStringSource

concatenate a list of C string literals