haskore-0.2.0.8: The Haskore Computer Music System

Safe HaskellSafe
LanguageHaskell2010

Haskore.Interface.CSound.Orchestra

Documentation

data T out Source

Constructors

Cons Header [InstrBlock out] 

Instances

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

type SigExp = T SigTerm Source

type DelayLine = DelayLineTerm SigExp Source

type Boolean = BooleanTerm SigExp Source

data Mono Source

Constructors

Mono SigExp 

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