{-# OPTIONS -Wall #-} -- Dump the contents of a MIDI file -- Note - GHC (Windows at least) appears to throw an error if -- the copyright symbol is used a Text meta-event. module Main where import ZMidi.Core import System.Environment main :: IO () main = do args <- getArgs case args of [path] -> process path _ -> putStrLn "Usage: MidiPrint " process :: FilePath -> IO () process filename = do ans <- readMidi filename case ans of Left (ParseErr n msg) -> putStrLn $ "Parse failure at " ++ show n ++ ": " ++ msg Right m -> printMidi m