Método Application.AlignTableCellTop (Project)
Alinea texto en la parte superior de la celda para las celdas seleccionadas de una tabla de informe.
Sintaxis
expresión. AlignTableCellTop
expresión Variable que representa un objeto Application.
Valor devuelto
Boolean
Ejemplo:
En el ejemplo siguiente, la macro AlignTableCells alinea el texto de todas las tablas del informe especificado.
Sub TestAlignReportTables()
Dim reportName As String
Dim alignment As String ' The value can be "top", "center", or "bottom".
reportName = "Align Table Cells Report"
alignment = "top"
AlignTableCells reportName, alignment
End Sub
' Align the text for all tables in a specified report.
Sub AlignTableCells(reportName As String, alignment As String)
Dim theReport As Report
Dim shp As Shape
Set theReport = ActiveProject.Reports(reportName)
' Activate the report. If the report is already active,
' ignore the run-time error 1004 from the Apply method.
On Error Resume Next
theReport.Apply
On Error GoTo 0
For Each shp In theReport.Shapes
Debug.Print "Shape: " & shp.Type & ", " & shp.Name
If shp.HasTable Then
shp.Select
Select Case alignment
Case "top"
AlignTableCellTop
Case "center"
AlignTableCellVerticalCenter
Case "bottom"
AlignTableCellBottom
Case Else
Debug.Print "AlignTableCells error: " & vbCrLf _
& "alignment must be top, center, or bottom."
End Select
End If
Next shp
End Sub
Vea también
Método AligntableCellVerticalCenter delobjeto ReportAligntableCellBottom (método)
Soporte técnico y comentarios
¿Tiene preguntas o comentarios sobre VBA para Office o esta documentación? Vea Soporte técnico y comentarios sobre VBA para Office para obtener ayuda sobre las formas en las que puede recibir soporte técnico y enviar comentarios.