HCodecs-0.1: A library to read, write and manipulate MIDI, WAVE, and SoundFont2 files.Source codeContentsIndex
Codec.SoundFont
PortabilityPortable
StabilityExperimental
MaintainerGeorge Giorgidze <http://cs.nott.ac.uk/~ggg/>
Description
Module for reading and writting of SoundFont instrument description files.
Documentation
data SoundFont Source
Constructors
SoundFont
infos :: Array Word Info
sdta :: Sdta
pdta :: Pdta
show/hide Instances
data Info Source
Constructors
Version Word Word
TargetSoundEngine String
BankName String
RomName String
RomVersion Word Word
CreationDate String
Authors String
IntendedProduct String
CopyrightMessage String
Comments String
UsedTools String
ReservedInfo String Word ByteString
show/hide Instances
data Sdta Source
Constructors
Sdta
smpl :: SampleData Int16
sm24 :: Maybe (SampleData Int8)
show/hide Instances
data Pdta Source
Constructors
Pdta
phdrs :: Array Word Phdr
pbags :: Array Word Bag
pmods :: Array Word Mod
pgens :: Array Word Generator
insts :: Array Word Inst
ibags :: Array Word Bag
imods :: Array Word Mod
igens :: Array Word Generator
shdrs :: Array Word Shdr
show/hide Instances
data Phdr Source
Constructors
Phdr
presetName :: String
preset :: Word
bank :: Word
presetBagNdx :: Word
library :: Word
genre :: Word
morphology :: Word
show/hide Instances
data Bag Source
Constructors
Bag
genNdx :: Word
modNdx :: Word
show/hide Instances
data Mod Source
Constructors
Mod
srcOper :: Word
destOper :: Word
amount :: Int
amtSrcOper :: Word
transOper :: Word
show/hide Instances
data Generator Source
Constructors
StartAddressOffset Int
EndAddressOffset Int
LoopStartAddressOffset Int
LoopEndAddressOffset Int
StartAddressCoarseOffset Int
ModLfoToPitch Int
VibLfoToPitch Int
ModEnvToPitch Int
InitFc Int
InitQ Int
ModLfoToFc Int
ModEnvToFc Int
EndAddressCoarseOffset Int
ModLfoToVol Int
Chorus Int
Reverb Int
Pan Int
DelayModLfo Int
FreqModLfo Int
DelayVibLfo Int
FreqVibLfo Int
DelayModEnv Int
AttackModEnv Int
HoldModEnv Int
DecayModEnv Int
SustainModEnv Int
ReleaseModEnv Int
KeyToModEnvHold Int
KeyToModEnvDecay Int
DelayVolEnv Int
AttackVolEnv Int
HoldVolEnv Int
DecayVolEnv Int
SustainVolEnv Int
ReleaseVolEnv Int
KeyToVolEnvHold Int
KeyToVolEnvDecay Int
InstIndex Word
KeyRange Word Word
VelRange Word Word
LoopStartAddressCoarseOffset Int
Key Word
Vel Word
InitAtten Int
LoopEndAddressCoarseOffset Int
CoarseTune Int
FineTune Int
SampleIndex Word
SampleMode SampleMode
ScaleTuning Int
ExclusiveClass Int
RootKey Word
ReservedGen Int Int
show/hide Instances
isSampleIndex :: Generator -> BoolSource
isInstIndex :: Generator -> BoolSource
data Inst Source
Constructors
Inst
instName :: String
instBagNdx :: Word
show/hide Instances
data Shdr Source
Constructors
Shdr
sampleName :: String
start :: Word
end :: Word
startLoop :: Word
endLoop :: Word
sampleRate :: Word
originalPitch :: Word
pitchCorrection :: Int
sampleLink :: Word
sampleType :: Word
show/hide Instances
importFile :: FilePath -> IO (Either String SoundFont)Source
exportFile :: FilePath -> SoundFont -> IO ()Source
parseSoundFont :: Parser SoundFontSource
buildSoundFont :: SoundFont -> BuilderSource
parseInfos :: Parser (Array Word Info)Source
buildInfos :: Array Word Info -> BuilderSource
parseSdta :: Parser SdtaSource
buildSdta :: Sdta -> BuilderSource
parsePdta :: Parser PdtaSource
buildPdta :: Pdta -> BuilderSource
Produced by Haddock version 2.4.2