{-# LANGUAGE NoImplicitPrelude #-}
module Bamboo.Type.Pager where

import Bamboo.Helper.PreludeEnv
import Data.Default


data Pager = Pager {
  total         :: Int,
  current       :: Int,
  has_next      :: Bool,
  has_previous  :: Bool,
  next          :: Int,
  previous      :: Int,
  per_page      :: Int
  }
  deriving (Eq, Show)

instance Default Bool where
  def = False

instance Default Pager where
  def = Pager def def def def def def def