haskore-0.2.0.7: The Haskore Computer Music System

Safe HaskellSafe-Inferred
LanguageHaskell2010

Haskore.Interface.CSound.Orchestra

Documentation

data T out Source

Constructors

Cons Header [InstrBlock out] 

Instances

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

data InstrBlock a Source

Instances

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

type SigExp = T SigTerm Source

type DelayLine = DelayLineTerm SigExp Source

type Boolean = BooleanTerm SigExp Source

class (Show c, Eq c) => Output c where Source

data Mono Source

Constructors

Mono SigExp 

Instances

data Stereo Source

Constructors

Stereo SigExp SigExp 

data Quad Source

Instances

data EvalRate Source

Constructors

NR 
CR 
AR 

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

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

save :: Output a => FilePath -> T a -> IO () 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

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

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

type Orc a b = State (OrcState a) b Source

addInstr :: Output a => InstrBlock a -> Orc a () Source

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

test :: IO () Source

test1 :: StatementDefs Source