module System.MIDI.Placeholder {-# WARNING "Linux is not supported by hmidi at the moment!" #-}
( module System.MIDI.Base
, Source
, Destination
, Connection
, enumerateSources
, enumerateDestinations
, MIDIHasName
, getName
, getModel
, getManufacturer
, openSource
, openDestination
, close
, send
, sendSysEx
, start
, stop
, getNextEvent
, checkNextEvent
, getEvents
, getEventsUntil
, currentTime
) where
import Data.Word
import System.MIDI.Base
data Source
data Destination
data Connection
class MIDIHasName c
instance MIDIHasName Source
instance MIDIHasName Destination
linuxUndefined :: a
linuxUndefined :: a
linuxUndefined = [Char] -> a
forall a. HasCallStack => [Char] -> a
error [Char]
"hmidi: Linux is not supported"
enumerateSources :: IO [Source]
enumerateSources :: IO [Source]
enumerateSources = IO [Source]
forall a. a
linuxUndefined
enumerateDestinations :: IO [Destination]
enumerateDestinations :: IO [Destination]
enumerateDestinations = IO [Destination]
forall a. a
linuxUndefined
getName :: MIDIHasName a => a -> IO String
getModel :: MIDIHasName a => a -> IO String
getManufacturer :: MIDIHasName a => a -> IO String
getName :: a -> IO [Char]
getName = a -> IO [Char]
forall a. a
linuxUndefined
getModel :: a -> IO [Char]
getModel = a -> IO [Char]
forall a. a
linuxUndefined
getManufacturer :: a -> IO [Char]
getManufacturer = a -> IO [Char]
forall a. a
linuxUndefined
openSource :: Source -> Maybe ClientCallback -> IO Connection
openSource :: Source -> Maybe ClientCallback -> IO Connection
openSource = Source -> Maybe ClientCallback -> IO Connection
forall a. a
linuxUndefined
openDestination :: Destination -> IO Connection
openDestination :: Destination -> IO Connection
openDestination = Destination -> IO Connection
forall a. a
linuxUndefined
getNextEvent :: Connection -> IO (Maybe MidiEvent)
getNextEvent :: Connection -> IO (Maybe MidiEvent)
getNextEvent = Connection -> IO (Maybe MidiEvent)
forall a. a
linuxUndefined
checkNextEvent :: Connection -> IO (Maybe MidiEvent)
checkNextEvent :: Connection -> IO (Maybe MidiEvent)
checkNextEvent = Connection -> IO (Maybe MidiEvent)
forall a. a
linuxUndefined
getEventsUntil :: Connection -> TimeStamp -> IO [MidiEvent]
getEventsUntil :: Connection -> TimeStamp -> IO [MidiEvent]
getEventsUntil = Connection -> TimeStamp -> IO [MidiEvent]
forall a. a
linuxUndefined
getEvents :: Connection -> IO [MidiEvent]
getEvents :: Connection -> IO [MidiEvent]
getEvents = Connection -> IO [MidiEvent]
forall a. a
linuxUndefined
send :: Connection -> MidiMessage -> IO ()
send :: Connection -> MidiMessage -> IO ()
send = Connection -> MidiMessage -> IO ()
forall a. a
linuxUndefined
sendSysEx :: Connection -> [Word8] -> IO ()
sendSysEx :: Connection -> [Word8] -> IO ()
sendSysEx = Connection -> [Word8] -> IO ()
forall a. a
linuxUndefined
start :: Connection -> IO ()
start :: Connection -> IO ()
start = Connection -> IO ()
forall a. a
linuxUndefined
stop :: Connection -> IO ()
stop :: Connection -> IO ()
stop = Connection -> IO ()
forall a. a
linuxUndefined
close :: Connection -> IO ()
close :: Connection -> IO ()
close = Connection -> IO ()
forall a. a
linuxUndefined
currentTime :: Connection -> IO Word32
currentTime :: Connection -> IO TimeStamp
currentTime = Connection -> IO TimeStamp
forall a. a
linuxUndefined