{-# LANGUAGE NoBinaryLiterals #-}
module TFindLiteralDoLet where

doLet :: IO ()
doLet = do
    let x = 199
        y = 144
    pure ()