Skip to content

Commit

Permalink
Use Type over *
Browse files Browse the repository at this point in the history
- Is warning in newer GHCs
  • Loading branch information
dmjio committed Feb 20, 2025
1 parent e4d3489 commit 4eb261b
Showing 1 changed file with 4 additions and 2 deletions.
6 changes: 4 additions & 2 deletions src/Miso/TypeLevel.hs
Original file line number Diff line number Diff line change
Expand Up @@ -4,12 +4,14 @@
{-# LANGUAGE TypeOperators #-}
module Miso.TypeLevel ( ToServerRoutes ) where

import Miso.Html
import Data.Kind
import Servant.API
import Servant.HTML.Lucid

import Miso.Html

-- | Convert client route type to a server web handler type
type family ToServerRoutes (layout :: k) (wrapper :: * -> *) (action :: *) :: k where
type family ToServerRoutes (layout :: k) (wrapper :: Type -> Type) (action :: Type) :: k where
ToServerRoutes (a :<|> b) wrapper action =
ToServerRoutes a wrapper action :<|>
ToServerRoutes b wrapper action
Expand Down

0 comments on commit 4eb261b

Please sign in to comment.