{-# LANGUAGE NoImplicitPrelude #-}

module Prelude.Source.System.IO (
    putChar,
    putStr, putStrLn, print,
    getChar,
    getLine, getContents, interact,
    readFile, writeFile, appendFile, readIO, readLn,
  ) where

import Prelude (
    putChar,
    putStr, putStrLn, print,
    getChar,
    getLine, getContents, interact,
    readFile, writeFile, appendFile, readIO, readLn,
  )