Merge pull request #2666 from unisonweb/cp/ormolu-tracking

Add ORMOLU_DISABLE to every file to allow auto-formatting.
This commit is contained in:
Chris Penner 2021-11-24 09:00:23 -06:00 committed by GitHub
commit d55625b935
No known key found for this signature in database
GPG Key ID: 4AEE18F83AFDEB23
285 changed files with 286 additions and 1 deletions

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
{-# LANGUAGE RankNTypes #-}
{-# LANGUAGE ScopedTypeVariables #-}
{-# LANGUAGE DeriveFunctor #-}

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
module U.Codebase.Sqlite.Branch.Format where
import Data.Vector (Vector)

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
{-# LANGUAGE RankNTypes #-}
{-# LANGUAGE ScopedTypeVariables #-}

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
{-# LANGUAGE DerivingVia #-}
{-# LANGUAGE FlexibleInstances #-}
{-# LANGUAGE PatternSynonyms #-}

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
{-# LANGUAGE DerivingVia #-}
module U.Codebase.Sqlite.Decl.Format where

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
module U.Codebase.Sqlite.JournalMode where
data JournalMode = DELETE | TRUNCATE | PERSIST | MEMORY | WAL | OFF

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
{-# LANGUAGE DerivingVia #-}
module U.Codebase.Sqlite.LocalIds where

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
module U.Codebase.Sqlite.ObjectType where
import Database.SQLite.Simple.FromField (FromField(..))

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
{-# LANGUAGE ApplicativeDo #-}
{-# LANGUAGE BlockArguments #-}
{-# LANGUAGE ConstraintKinds #-}

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
module U.Codebase.Sqlite.Patch.Format where
import Data.Vector (Vector)

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
{-# LANGUAGE BlockArguments #-}
{-# LANGUAGE ConstraintKinds #-}
{-# LANGUAGE DerivingVia #-}
@ -241,7 +242,7 @@ setFlags = do
execute_ "PRAGMA foreign_keys = ON;"
setJournalMode JournalMode.WAL
{- ORMOLU_DISABLE -}
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
schemaVersion :: DB m => m SchemaVersion
schemaVersion = queryAtoms_ sql >>= \case
[] -> error $ show NoSchemaVersion

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
{-# LANGUAGE FlexibleInstances #-}
{-# LANGUAGE LambdaCase #-}
{-# LANGUAGE TypeSynonymInstances #-}

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
{-# LANGUAGE BlockArguments #-}
{-# LANGUAGE LambdaCase #-}
{-# LANGUAGE RankNTypes #-}

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
module U.Codebase.Sqlite.Symbol where
import Data.Word (Word64)

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
{-# LANGUAGE ApplicativeDo #-}
{-# LANGUAGE BlockArguments #-}
{-# LANGUAGE FlexibleContexts #-}

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
{-# LANGUAGE DerivingVia #-}
module U.Codebase.Sqlite.Term.Format where

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
{-# LANGUAGE BlockArguments #-}
{-# LANGUAGE LambdaCase #-}
{-# LANGUAGE RecordWildCards #-}

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
module U.Codebase.Branch where
import Data.Map (Map)

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
{-# LANGUAGE RankNTypes, PatternSynonyms #-}
module U.Codebase.Causal where

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
module U.Codebase.HashTags where
import U.Util.Hash (Hash)

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
module U.Codebase.Kind where
data Kind = Star | Arrow Kind Kind deriving (Eq,Ord,Read,Show)

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
{-# LANGUAGE DeriveTraversable #-}
{-# LANGUAGE LambdaCase #-}
{-# LANGUAGE DeriveFunctor #-}

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
{-# LANGUAGE LambdaCase #-}
{-# LANGUAGE FlexibleInstances #-}
{-# LANGUAGE TypeSynonymInstances #-}

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
{-# LANGUAGE LambdaCase #-}
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE RecordWildCards #-}

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
{-# LANGUAGE BlockArguments #-}
{-# LANGUAGE DeriveAnyClass #-}
{-# LANGUAGE DeriveFoldable #-}

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
{-# LANGUAGE StandaloneDeriving #-}
{-# LANGUAGE BlockArguments #-}
{-# LANGUAGE LambdaCase #-}

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
module U.Core.ABT.Var where
import Data.Set (Set)

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
{-# LANGUAGE TypeApplications #-}
{-# LANGUAGE BlockArguments #-}
{-# LANGUAGE FlexibleContexts #-}

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
{-# LANGUAGE FlexibleContexts #-}
{-# LANGUAGE BlockArguments #-}
{-# LANGUAGE LambdaCase #-}

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
{-# LANGUAGE ViewPatterns #-}
{-# LANGUAGE TupleSections #-}
{-# LANGUAGE PatternSynonyms #-}

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
module Main where
import qualified Codec.Binary.Base32Hex as Sandi

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
{-# LANGUAGE RankNTypes #-}
{-# LANGUAGE LambdaCase #-}
{-# LANGUAGE RecordWildCards #-}

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
module U.Util.Components where
import qualified Data.Graph as Graph

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
{-# LANGUAGE ConstraintKinds #-}
module U.Util.Lens where

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
module U.Util.Monoid where
import Data.Foldable (toList)

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
module U.Util.Set where
import Data.Set (Set)

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
{-# LANGUAGE BangPatterns #-}
module U.Util.Timing where

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
module Unison.Prelude
( module X,
readUtf8,

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
module Main where
import Criterion.Main
import qualified Unison.Util.Relation as R

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
module Unison.Util.Relation
( Relation,

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
{-# LANGUAGE RecordWildCards #-}
module Unison.Util.Relation3 where

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
{-# LANGUAGE RecordWildCards #-}
module Unison.Util.Relation4 where

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
module Main where
import EasyTest

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
{-# language PatternSynonyms #-}
module Main(main) where

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
{-# Language OverloadedStrings #-}
module Main where

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE Rank2Types #-}

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE PatternSynonyms #-}
{-# LANGUAGE ViewPatterns #-}

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE TypeApplications #-}

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
module Unison.Codebase
( Codebase,

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
{-# LANGUAGE TemplateHaskell #-}
{-# LANGUAGE RecordWildCards #-}
{-# LANGUAGE PatternSynonyms #-}

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
{-# LANGUAGE TemplateHaskell #-}
{-# LANGUAGE RecordWildCards #-}
{-# LANGUAGE PatternSynonyms #-}

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
{-# LANGUAGE PatternSynonyms #-}
{-# LANGUAGE RankNTypes #-}
{-# LANGUAGE RecordWildCards #-}

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
module Unison.Codebase.BranchDiff where
import Unison.Prelude

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
module Unison.Codebase.BranchUtil where
import Unison.Prelude

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
{-# LANGUAGE RankNTypes #-}
{-# LANGUAGE DeriveGeneric #-}
{-# LANGUAGE TemplateHaskell #-}

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
{-# LANGUAGE RankNTypes #-}
{-# LANGUAGE DeriveGeneric #-}

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
module Unison.Codebase.CodeLookup where
import Unison.Prelude

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
{-# LANGUAGE DeriveGeneric #-}
module Unison.Codebase.Editor.DisplayObject where

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE ViewPatterns #-}

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
{-# LANGUAGE RecordWildCards #-}
{-# LANGUAGE OverloadedStrings #-}
module Unison.Codebase.Editor.RemoteRepo where

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
{-# LANGUAGE GADTs #-}
{-# LANGUAGE PartialTypeSignatures #-}
{-# LANGUAGE OverloadedStrings #-}

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
module Unison.Codebase.FileCodebase (codebaseExists) where
import System.FilePath ((</>))

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
module Unison.Codebase.GitError where
import Unison.Prelude

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
{-# LANGUAGE ApplicativeDo #-}
{-# LANGUAGE OverloadedStrings #-}

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
{-# LANGUAGE ApplicativeDo #-}
{-# LANGUAGE OverloadedStrings #-}

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
{-# LANGUAGE ApplicativeDo #-}
{-# LANGUAGE OverloadedStrings #-}

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
{-# LANGUAGE GADTs #-}
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE PatternSynonyms #-}

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
module Unison.Codebase.Metadata where
import Unison.Prelude

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
{-# LANGUAGE TemplateHaskell #-}
{-# LANGUAGE PatternSynonyms #-}
{-# LANGUAGE RecordWildCards #-}

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
{-# LANGUAGE GeneralizedNewtypeDeriving #-}
{-# LANGUAGE OverloadedLists #-}
{-# LANGUAGE OverloadedStrings #-}

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
{-# LANGUAGE GeneralizedNewtypeDeriving #-}
{-# LANGUAGE OverloadedLists #-}
{-# LANGUAGE OverloadedStrings #-}

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
{-# LANGUAGE ViewPatterns #-}
module Unison.Codebase.Reflog (Entry(..), fromText, toText) where

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
{-# LANGUAGE RankNTypes #-}
{-# LANGUAGE PatternSynonyms #-}

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
{-# LANGUAGE RankNTypes #-}
module Unison.Codebase.Serialization where

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
module Unison.Codebase.ShortBranchHash where
import Unison.Prelude

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
{-# LANGUAGE DeriveAnyClass #-}
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE QuasiQuotes #-}

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
{-# LANGUAGE DeriveGeneric #-}
{-# LANGUAGE DerivingVia #-}
{-# LANGUAGE PatternSynonyms #-}

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
{-# LANGUAGE ViewPatterns #-}
module Unison.Codebase.SqliteCodebase.Conversions where

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
module Unison.Codebase.SqliteCodebase.GitError where
import Unison.Codebase.Editor.RemoteRepo (ReadRepo)

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
{-# LANGUAGE ScopedTypeVariables #-}
module Unison.Codebase.SqliteCodebase.SyncEphemeral where

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
module Unison.Codebase.TermEdit where
import Unison.Hashable (Hashable)

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE ViewPatterns #-}

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
module Unison.Codebase.TypeEdit where
import Unison.Reference (Reference)

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
module Unison.Codebase.Verbosity
where

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
{-# LANGUAGE PatternSynonyms #-}
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE TypeApplications #-}

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
{-# OPTIONS_GHC -Wno-orphans #-}
{-# LANGUAGE OverloadedStrings #-}

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
{-# Language DeriveTraversable #-}
{-# Language OverloadedStrings #-}
{-# Language ViewPatterns #-}

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
{-# LANGUAGE RecordWildCards #-}
{-# LANGUAGE PatternSynonyms #-}
{-# LANGUAGE UnicodeSyntax #-}

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
{-# LANGUAGE ViewPatterns #-}
module Unison.Hashing.V2.Convert

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
{-# LANGUAGE DeriveAnyClass #-}
{-# LANGUAGE DeriveFoldable #-}
{-# LANGUAGE DeriveTraversable #-}

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
{-# LANGUAGE PatternSynonyms #-}
module Unison.Hashing.V2.LabeledDependency

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
{-# Language DeriveTraversable, DeriveGeneric, PatternSynonyms, OverloadedStrings #-}
module Unison.Hashing.V2.Pattern where

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
{-# LANGUAGE DeriveGeneric #-}
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE PatternSynonyms #-}

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
module Unison.Hashing.V2.Reference.Util where
import Unison.Prelude

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE PatternSynonyms #-}

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
{-# LANGUAGE DeriveFoldable #-}
{-# LANGUAGE DeriveGeneric #-}
{-# LANGUAGE DeriveTraversable #-}

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
{-# LANGUAGE DeriveGeneric #-}
{-# LANGUAGE DeriveTraversable #-}
{-# LANGUAGE OverloadedStrings #-}

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
{-# LANGUAGE BangPatterns #-}
{-# LANGUAGE ViewPatterns #-}
{-# LANGUAGE TemplateHaskell #-}

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
{-# LANGUAGE BangPatterns #-}
{-# LANGUAGE DeriveFoldable #-}
{-# LANGUAGE DeriveTraversable #-}

View File

@ -1,3 +1,4 @@
{- ORMOLU_DISABLE -} -- Remove this when the file is ready to be auto-formatted
module Unison.NamePrinter where
import Unison.Prelude

Some files were not shown because too many files have changed in this diff Show More