A RetroSearch Logo

Home - News ( United States | United Kingdom | Italy | Germany ) - Football scores

Search Query:

Showing content from http://hackage.haskell.org/package/base/docs/Data-Semigroup.html below:

Data.Semigroup

Semigroup ByteArray Source #

Since: base-4.17.0.0

Instance details

Defined in Data.Array.Byte

Semigroup Void Source #

Since: base-4.9.0.0

Instance details

Defined in GHC.Internal.Base

Semigroup All Source #

Since: base-4.9.0.0

Instance details

Defined in GHC.Internal.Data.Semigroup.Internal

Semigroup Any Source #

Since: base-4.9.0.0

Instance details

Defined in GHC.Internal.Data.Semigroup.Internal

Semigroup Event Source #

Since: base-4.10.0.0

Instance details

Defined in GHC.Internal.Event.Internal.Types

Semigroup EventLifetime Source #

Since: base-4.11.0.0

Instance details

Defined in GHC.Internal.Event.Internal.Types

Semigroup Lifetime Source #

Since: base-4.10.0.0

Instance details

Defined in GHC.Internal.Event.Internal.Types

Semigroup ExceptionContext Source #   Instance details

Defined in GHC.Internal.Exception.Context

Semigroup Ordering Source #

Since: base-4.9.0.0

Instance details

Defined in GHC.Internal.Base

Semigroup () Source #

Since: base-4.9.0.0

Instance details

Defined in GHC.Internal.Base

Semigroup (Comparison a) Source #

(<>) on comparisons combines results with (<>) @Ordering. Without newtypes this equals liftA2 (liftA2 (<>)).

(<>) :: Comparison a -> Comparison a -> Comparison a
Comparison cmp <> Comparison cmp' = Comparison a a' ->
  cmp a a' <> cmp a a'
Instance details

Defined in Data.Functor.Contravariant

Semigroup (Equivalence a) Source #

(<>) on equivalences uses logical conjunction (&&) on the results. Without newtypes this equals liftA2 (liftA2 (&&)).

(<>) :: Equivalence a -> Equivalence a -> Equivalence a
Equivalence equiv <> Equivalence equiv' = Equivalence a b ->
  equiv a b && equiv' a b
Instance details

Defined in Data.Functor.Contravariant

Semigroup (Predicate a) Source #

(<>) on predicates uses logical conjunction (&&) on the results. Without newtypes this equals liftA2 (&&).

(<>) :: Predicate a -> Predicate a -> Predicate a
Predicate pred <> Predicate pred' = Predicate a ->
  pred a && pred' a
Instance details

Defined in Data.Functor.Contravariant

Semigroup (First a) Source #

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Semigroup (Last a) Source #

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Ord a => Semigroup (Max a) Source #

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Ord a => Semigroup (Min a) Source #

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Monoid m => Semigroup (WrappedMonoid m) Source #

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Semigroup (NonEmpty a) Source #

Since: base-4.9.0.0

Instance details

Defined in GHC.Internal.Base

Semigroup a => Semigroup (STM a) Source #

Since: base-4.17.0.0

Instance details

Defined in GHC.Internal.Conc.Sync

Bits a => Semigroup (And a) Source #

Since: base-4.16

Instance details

Defined in GHC.Internal.Data.Bits

FiniteBits a => Semigroup (Iff a) Source #

This constraint is arguably too strong. However, as some types (such as Natural) have undefined complement, this is the only safe choice.

Since: base-4.16

Instance details

Defined in GHC.Internal.Data.Bits

Bits a => Semigroup (Ior a) Source #

Since: base-4.16

Instance details

Defined in GHC.Internal.Data.Bits

Bits a => Semigroup (Xor a) Source #

Since: base-4.16

Instance details

Defined in GHC.Internal.Data.Bits

Semigroup a => Semigroup (Identity a) Source #

Since: base-4.9.0.0

Instance details

Defined in GHC.Internal.Data.Functor.Identity

Ord a => Semigroup (Max a) Source #

Since: base-4.11.0.0

Instance details

Defined in GHC.Internal.Data.Functor.Utils

Ord a => Semigroup (Min a) Source #

Since: base-4.11.0.0

Instance details

Defined in GHC.Internal.Data.Functor.Utils

Semigroup (First a) Source #

Since: base-4.9.0.0

Instance details

Defined in GHC.Internal.Data.Monoid

Semigroup (Last a) Source #

Since: base-4.9.0.0

Instance details

Defined in GHC.Internal.Data.Monoid

Semigroup a => Semigroup (Down a) Source #

Since: base-4.11.0.0

Instance details

Defined in GHC.Internal.Data.Ord

Semigroup a => Semigroup (Dual a) Source #

Since: base-4.9.0.0

Instance details

Defined in GHC.Internal.Data.Semigroup.Internal

Semigroup (Endo a) Source #

Since: base-4.9.0.0

Instance details

Defined in GHC.Internal.Data.Semigroup.Internal

Num a => Semigroup (Product a) Source #

Since: base-4.9.0.0

Instance details

Defined in GHC.Internal.Data.Semigroup.Internal

Num a => Semigroup (Sum a) Source #

Since: base-4.9.0.0

Instance details

Defined in GHC.Internal.Data.Semigroup.Internal

(Generic a, Semigroup (Rep a ())) => Semigroup (Generically a) Source #

Since: base-4.17.0.0

Instance details

Defined in GHC.Internal.Generics

Semigroup p => Semigroup (Par1 p) Source #

Since: base-4.12.0.0

Instance details

Defined in GHC.Internal.Generics

Semigroup a => Semigroup (Q a) Source #

Since: ghc-internal-2.17.0.0

Instance details

Defined in GHC.Internal.TH.Syntax

Semigroup a => Semigroup (IO a) Source #

Since: base-4.10.0.0

Instance details

Defined in GHC.Internal.Base

Semigroup a => Semigroup (Maybe a) Source #

Since: base-4.9.0.0

Instance details

Defined in GHC.Internal.Base

Semigroup a => Semigroup (Solo a) Source #

Since: base-4.15

Instance details

Defined in GHC.Internal.Base

Semigroup [a] Source #

Since: base-4.9.0.0

Instance details

Defined in GHC.Internal.Base

Semigroup a => Semigroup (Op a b) Source #

(<>) @(Op a b) without newtypes is (<>) @(b->a) = liftA2 (<>). This lifts the Semigroup operation (<>) over the output of a.

(<>) :: Op a b -> Op a b -> Op a b
Op f <> Op g = Op a -> f a <> g a
Instance details

Defined in Data.Functor.Contravariant

Semigroup (Either a b) Source #

Since: base-4.9.0.0

Instance details

Defined in GHC.Internal.Data.Either

Semigroup (Proxy s) Source #

Since: base-4.9.0.0

Instance details

Defined in GHC.Internal.Data.Proxy

Semigroup (U1 p) Source #

Since: base-4.12.0.0

Instance details

Defined in GHC.Internal.Generics

Semigroup (V1 p) Source #

Since: base-4.12.0.0

Instance details

Defined in GHC.Internal.Generics

Semigroup a => Semigroup (ST s a) Source #

Since: base-4.11.0.0

Instance details

Defined in GHC.Internal.ST

(Semigroup a, Semigroup b) => Semigroup (a, b) Source #

Since: base-4.9.0.0

Instance details

Defined in GHC.Internal.Base

Semigroup b => Semigroup (a -> b) Source #

Since: base-4.9.0.0

Instance details

Defined in GHC.Internal.Base

Semigroup a => Semigroup (Const a b) Source #

Since: base-4.9.0.0

Instance details

Defined in GHC.Internal.Data.Functor.Const

(Applicative f, Semigroup a) => Semigroup (Ap f a) Source #

Since: base-4.12.0.0

Instance details

Defined in GHC.Internal.Data.Monoid

Alternative f => Semigroup (Alt f a) Source #

Since: base-4.9.0.0

Instance details

Defined in GHC.Internal.Data.Semigroup.Internal

Semigroup (f p) => Semigroup (Rec1 f p) Source #

Since: base-4.12.0.0

Instance details

Defined in GHC.Internal.Generics

(Semigroup a, Semigroup b, Semigroup c) => Semigroup (a, b, c) Source #

Since: base-4.9.0.0

Instance details

Defined in GHC.Internal.Base

Methods

(<>) :: (a, b, c) -> (a, b, c) -> (a, b, c) Source #

sconcat :: NonEmpty (a, b, c) -> (a, b, c) Source #

stimes :: Integral b0 => b0 -> (a, b, c) -> (a, b, c) Source #

(Semigroup (f a), Semigroup (g a)) => Semigroup (Product f g a) Source #

Since: base-4.16.0.0

Instance details

Defined in Data.Functor.Product

(Semigroup (f p), Semigroup (g p)) => Semigroup ((f :*: g) p) Source #

Since: base-4.12.0.0

Instance details

Defined in GHC.Internal.Generics

Semigroup c => Semigroup (K1 i c p) Source #

Since: base-4.12.0.0

Instance details

Defined in GHC.Internal.Generics

(Semigroup a, Semigroup b, Semigroup c, Semigroup d) => Semigroup (a, b, c, d) Source #

Since: base-4.9.0.0

Instance details

Defined in GHC.Internal.Base

Methods

(<>) :: (a, b, c, d) -> (a, b, c, d) -> (a, b, c, d) Source #

sconcat :: NonEmpty (a, b, c, d) -> (a, b, c, d) Source #

stimes :: Integral b0 => b0 -> (a, b, c, d) -> (a, b, c, d) Source #

Semigroup (f (g a)) => Semigroup (Compose f g a) Source #

Since: base-4.16.0.0

Instance details

Defined in Data.Functor.Compose

Semigroup (f (g p)) => Semigroup ((f :.: g) p) Source #

Since: base-4.12.0.0

Instance details

Defined in GHC.Internal.Generics

Semigroup (f p) => Semigroup (M1 i c f p) Source #

Since: base-4.12.0.0

Instance details

Defined in GHC.Internal.Generics

(Semigroup a, Semigroup b, Semigroup c, Semigroup d, Semigroup e) => Semigroup (a, b, c, d, e) Source #

Since: base-4.9.0.0

Instance details

Defined in GHC.Internal.Base

Methods

(<>) :: (a, b, c, d, e) -> (a, b, c, d, e) -> (a, b, c, d, e) Source #

sconcat :: NonEmpty (a, b, c, d, e) -> (a, b, c, d, e) Source #

stimes :: Integral b0 => b0 -> (a, b, c, d, e) -> (a, b, c, d, e) Source #


RetroSearch is an open source project built by @garambo | Open a GitHub Issue

Search and Browse the WWW like it's 1997 | Search results from DuckDuckGo

HTML: 3.2 | Encoding: UTF-8 | Version: 0.7.4