haskore-0.2.0.5: The Haskore Computer Music System

Safe HaskellSafe-Inferred

Haskore.Interface.CSound.Orchestra

Documentation

data Output out => T out Source

Constructors

Cons Header [InstrBlock out] 

Instances

Output out => Eq (T out) 
Output out => Show (T out) 

data InstrBlock a Source

Instances

Eq a => Eq (InstrBlock a) 
Show a => Show (InstrBlock a) 

type AudRate = IntSource

type CtrlRate = IntSource

type SigExp = T SigTermSource

type DelayLine = DelayLineTerm SigExpSource

type Boolean = BooleanTerm SigExpSource

data GlobalSig Source

Constructors

Global EvalRate (SigExp -> SigExp -> SigExp) Int 

Instances

Eq GlobalSig 
Show GlobalSig 

class (Show c, Eq c) => Output c whereSource

Methods

getChannels :: c -> [SigExp]Source

getName :: c -> StringSource

getChannelCount :: c -> IntSource

data Mono Source

Constructors

Mono SigExp 

Instances

Eq Mono 
Show Mono 
Output Mono 

data Stereo Source

Constructors

Stereo SigExp SigExp 

Instances

data Quad Source

Instances

Eq Quad 
Show Quad 
Output Quad 

data EvalRate Source

Constructors

NR 
CR 
AR 

Instances

Eq EvalRate 
Ord EvalRate 
Show EvalRate 

data Instrument Source

Instances

type Name = StringSource

sigGen :: Function -> EvalRate -> OutCount -> [SigExp] -> SigExpSource

toString :: Output a => T a -> StringSource

saveIA :: Output a => T a -> IO ()Source

save :: Output a => FilePath -> T a -> IO ()Source

channelCount :: Output a => T a -> IntSource

(<*) :: TreeTerm term => T term -> T term -> BooleanTerm (T term)Source

(<=*) :: TreeTerm term => T term -> T term -> BooleanTerm (T term)Source

(>*) :: TreeTerm term => T term -> T term -> BooleanTerm (T term)Source

(>=*) :: TreeTerm term => T term -> T term -> BooleanTerm (T term)Source

(==*) :: TreeTerm term => T term -> T term -> BooleanTerm (T term)Source

(/=*) :: TreeTerm term => T term -> T term -> BooleanTerm (T term)Source

ifthen :: TreeTerm term => BooleanTerm (T term) -> T term -> T term -> T termSource

constEnum :: Enum a => a -> SigExpSource

data IndexMode Source

Constructors

RawIndex 
NormalIndex 

Instances

Enum IndexMode 
Eq IndexMode 
Show IndexMode 

type Orc a b = State (OrcState a) bSource

mkOrc :: Output a => Header -> Orc a () -> T aSource

test :: IO ()Source

test1 :: StatementDefsSource