Sub Macro1()
'
' Macro1 Macro
'
' Keyboard Shortcut: Ctrl+Shift+Y
'
Dim maxCell As Long
Dim maxRow
With ActiveSheet
maxRow = .Cells(.Rows.Count, "A").End(xlDown).Row
maxCell = .Cells(6, .Columns.Count).End(xlToLeft).Column
Dim j
j = 4
Dim col
col = Array(2.1, 0.5, 0.6, 2.11, 0.9888, 0.1, 0.989)
Rows(6).Select
For i = 1 To maxCell / 4 Step 1
Range(Cells(6, j), Cells(6, j + 3)).Select
With Selection.Interior
.Pattern = xlPatternLinearGradient
.Gradient.Degree = 90
.Gradient.ColorStops.Clear
End With
With Selection.Interior.Gradient.ColorStops.Add(0)
.ThemeColor = xlThemeColorAccent1
.TintAndShade = 0.9234243
End With
With Selection.Interior.Gradient.ColorStops.Add(0)
.ThemeColor = xlThemeColorLight1
.TintAndShade = 0.934543
End With
j = i * 4
Next i
'-------------------------
Dim allRow
allRow = .Range(.Cells(1, 1), .Cells(maxRow, 1))
Dim myCell
'For Each myCell In allRow
' If Len(myCell.Value) > 0 Then
' Range(myCell, Cells(myCell.Row, maxCell)).Interior.ColorIndex = 4
' End If
'Next
For i = 7 To Range("C" & Rows.Count).End(xlUp).Row
'Set r = Range(Cells(i, 1), Cells(i, maxCell))
If Len(Cells(i, 1).Value) > 0 Then
'MsgBox "No Value, in " & r.Address
Range(Cells(i, 1), Cells(i, maxCell)).Select
With Selection.Interior
.Pattern = xlSolid
.PatternColorIndex = xlAutomatic
.ThemeColor = xlThemeColorDark2
.TintAndShade = -0.499984740745262
.PatternTintAndShade = 0
End With
End If
If Len(Cells(i, 2).Value) > 0 Then
'MsgBox "No Value, in " & r.Address
Range(Cells(i, 2), Cells(i, maxCell)).Select
With Selection.Interior
.Pattern = xlSolid
.PatternColorIndex = xlAutomatic
.ThemeColor = xlThemeColorDark2
.TintAndShade = -0.249946592608417
.PatternTintAndShade = 0
End With
End If
If Len(Cells(i, 3).Value) > 0 Then
'MsgBox "No Value, in " & r.Address
Range(Cells(i, 3), Cells(i, maxCell)).Select
With Selection.Interior
.Pattern = xlSolid
.PatternColorIndex = xlAutomatic
.ThemeColor = xlThemeColorDark2
.TintAndShade = -9.99481185338908E-02
.PatternTintAndShade = 0
End With
End If
Next i
End With
Cells(3, 2).Select
End Sub
Sub Macro3()
'
' Macro3 Macro
'
' Keyboard Shortcut: Ctrl+i
'
With Selection.Interior
.Pattern = xlSolid
.PatternColorIndex = xlAutomatic
.ThemeColor = xlThemeColorDark2
.TintAndShade = -0.499984740745262
.PatternTintAndShade = 0
End With
Range("E23").Select
With Selection.Interior
.Pattern = xlSolid
.PatternColorIndex = xlAutomatic
.ThemeColor = xlThemeColorDark2
.TintAndShade = -0.249946592608417
.PatternTintAndShade = 0
End With
Range("F23").Select
With Selection.Interior
.Pattern = xlSolid
.PatternColorIndex = xlAutomatic
.ThemeColor = xlThemeColorDark2
.TintAndShade = -9.99481185338908E-02
.PatternTintAndShade = 0
End With
End Sub
Sub Macro5()
'
' Macro5 Macro
'
' Keyboard Shortcut: Ctrl+u
'
Selection.FormatConditions.Add Type:=xlTextString, String:="'-", _
TextOperator:=xlBeginsWith
Selection.FormatConditions(Selection.FormatConditions.Count).SetFirstPriority
Selection.FormatConditions(1).StopIfTrue = False
End Sub