module Numeric.Probability.Show where

import qualified Data.List.HT as ListHT

{-
showL :: Show a => Int -> a -> String
showL n x = s ++ replicate (n-length s) ' '
            where s=show x

showL n x =
   ListHT.padRight1 ' ' n (show x)
-}

showR :: Show a => Int -> a -> String
showR :: forall a. Show a => Int -> a -> String
showR Int
n a
x =
   forall a. a -> Int -> [a] -> [a]
ListHT.padLeft Char
' ' Int
n (forall a. Show a => a -> String
show a
x)

--showP :: Float -> String
--showP f =  showR 3 (round (f*100))++"%"