Kaydet (Commit) fbec66f2 authored tarafından Norbert Thiebaud's avatar Norbert Thiebaud

remove abandonned, undelivered 'migrationanalysis' module

Change-Id: Ia3665f109b6a52138264854692a6e2b16240dca4
üst 144f6d44
......@@ -228,7 +228,6 @@ instsetoo_native\
libxml2\
libxmlsec\
libxslt\
migrationanalysis\
moz\
mysqlc\
mysqlcppconn\
......
Wizard to analyze potential problems when migrating from MSOffice to LibreOffice.
See also "Read_Me.odt" in this module directory.
Touch me to prevent that the localisation process extracts strings here
at migrationanalysis : soltools shell NULL
at migrationanalysis\src\msokill nmake - w at_src NULL
at migrationanalysis\src\driver_docs nmake - w at_src_driver NULL
at migrationanalysis\src\resources nmake - w at_src_resources NULL
at migrationanalysis\src\wizard nmake - w at_src_wizard NULL
at migrationanalysis\util nmake - w at_util at_src.w at_src_driver.w at_src_resources.w at_src_wizard.w NULL
'
' This file is part of the LibreOffice project.
'
' This Source Code Form is subject to the terms of the Mozilla Public
' License, v. 2.0. If a copy of the MPL was not distributed with this
' file, You can obtain one at http://mozilla.org/MPL/2.0/.
'
' This file incorporates work covered by the following license notice:
'
' Licensed to the Apache Software Foundation (ASF) under one or more
' contributor license agreements. See the NOTICE file distributed
' with this work for additional information regarding copyright
' ownership. The ASF licenses this file to you under the Apache
' License, Version 2.0 (the "License"); you may not use this file
' except in compliance with the License. You may obtain a copy of
' the License at http://www.apache.org/licenses/LICENSE-2.0 .
'
'### Build Support Module for running commands to export and import
'### modules from Word, Excel and PowerPoint Document Analysis driver documents
<job id="DocAnalysisBuildCmd" error="true" debug="true">
<script language="VBScript" src="DocAnalysisRunMacro.vbs"/>
<script language="VBScript">
Const CTITLE = "Document Analysis Command"
Const CWORD_DRIVER = "_OOoDocAnalysisWordDriver.doc"
Const CEXCEL_DRIVER = "_OOoDocAnalysisExcelDriver.xls"
Const CPP_DRIVER = "_OOoDocAnalysisPPTDriver.ppt"
Const CStub = "Stripped"
Const CUTIL_APPNAME_WORD = "Word"
Const CUTIL_APPNAME_EXCEL = "Excel"
Const CUTIL_APPNAME_POWERPOINT = "Powerpoint"
Const CDIAG_STD_DELAY = 2
Const CDEFAULT_SOURCE_DIR = ".\sources\"
Const CDEFAULT_TARGET_DIR = "."
Const CSOURCE_DIR_ARG = "X"
Const CTARGET_DIR_ARG = "T"
Const CUSAGE_ARG = "?"
Const CSTR_PAW = "\PAW\"
'######### Doc Analysis Build - Main Script Body #############
Dim mArgsNamed, mArgsUnnamed
Dim mSourceDir
Dim mTargetDir
On Error Resume Next
'### Process Arguments ###
Set mArgsNamed = WScript.Arguments.Named
Set mArgsUnnamed = WScript.Arguments.Unnamed
If mArgsNamed.Exists(CUSAGE_ARG) Then
Usage
FinalExit
End If
'# Source Dir
if mArgsNamed.Exists(CSOURCE_DIR_ARG) Then
mSourceDir = mArgsNamed.Item(CSOURCE_DIR_ARG)
Else
mSourceDir = CDEFAULT_SOURCE_DIR
End If
'# Target Dir
if mArgsNamed.Exists(CTARGET_DIR_ARG ) Then
mTargetDir = mArgsNamed.Item(CTARGET_DIR_ARG )
Else
mTargetDir = CDEFAULT_TARGET_DIR
End If
mSourceDir = daFso.GetAbsolutePathName(mSourceDir )
mTargetDir = daFso.GetAbsolutePathName(mTargetDir )
'# Check source and target dirs exist
If Not daFso.FolderExists(mSourceDir) Then
DAErrMsg "Source directory does not exist: " & mSourceDir, CDA_ERR_STD_DELAY
FinalExit
End If
If Not daFso.FolderExists(mTargetDir) Then
DAErrMsg "Target directory does not exist: " & mTargetDir, CDA_ERR_STD_DELAY
FinalExit
End If
Set mArgsNamed = Nothing
Set mArgsUnnamed = Nothing
'#### then continue with PAW
ImportAll mTargetDir & CSTR_PAW
'# Cleanup
FinalExit
'######### End - Main Script Body #############
'#### Doc Analysis Build - Support Functions ####
Sub Usage()
DAdiagMsg "Build command line tool to create Document Analysis driver documents" & vbLf & vbLf &_
"DocAnalysisBuildCmd [/X:<sourceDir>] [/T:<targetDir>]" & vbLf & vbLf &_
"/X:<sourceDir> base <source> directory " & vbLf & _
" The <sourceDir> is the base dir under which all the " & vbLf & _
" _res.bas files are located to import from" & vbLf & vbLf & _
"/T:<targetDir> target directory " & vbLf & _
" <targetDir> is where the new Driver docs" & vbLf & _
" will be created", 30
End Sub
'######################
Sub FinalExit()
DACleanUp
wscript.quit
End Sub
'######################
Sub ImportAll( aTargetDir )
'#### Create automation servers ####
DAsetupWrdServer
DAsetupExcelServer
DAsetupPPServer
If Not daFso.FolderExists( aTargetDir ) Then
daFso.CreateFolder( aTargetDir )
End If
BackupDrivers aTargetDir
DAOpenWrdDriver mSourceDir & "\" & CSTUB & CWORD_DRIVER
DAOpenExcelDriver mSourceDir & "\" & CSTUB & CEXCEL_DRIVER
DAOpenPPDriver mSourceDir & "\" & CSTUB & CPP_DRIVER
DASetTitle CTITLE & " - Import"
ImportSelectedProjectFiles mSourceDir, CUTIL_APPNAME_WORD
ImportSelectedProjectFiles mSourceDir, CUTIL_APPNAME_EXCEL
ImportSelectedProjectFiles mSourceDir, CUTIL_APPNAME_POWERPOINT
DAsaveWrdDriver aTargetDir & "\" & CWORD_DRIVER
DAsaveExcelDriver aTargetDir & "\" & CEXCEL_DRIVER
DAsavePPDriver aTargetDir & "\" & CPP_DRIVER
DACloseApps
End Sub
'######################
Sub BackupDrivers(importdir)
On Error Resume Next
Dim wrdPath
Dim xlsPath
Dim ppPath
wrdPath = daFso.GetAbsolutePathName(importdir & "\" & CWORD_DRIVER)
xlsPath= daFso.GetAbsolutePathName(importdir & "\" & CEXCEL_DRIVER)
ppPath= daFso.GetAbsolutePathName(importdir & "\" & CPP_DRIVER)
If daFso.FileExists( wrdPath ) Then daFso.CopyFile wrdPath, wrdPath & ".bak"
If daFso.FileExists( xlsPath ) Then daFso.CopyFile xlsPath, xlsPath & ".bak"
If daFso.FileExists( ppPath ) Then daFso.CopyFile ppPath, ppPath & ".bak"
End Sub
'######################
Sub ImportSelectedProjectFiles(dir, app_name)
On Error Resume Next
Dim base
Dim lcApp_name
lcApp_name = LCase(app_name)
'Driver Specific
base = dir & "\" & lcApp_name & "\"
DAImportFile base & "ApplicationSpecific.bas", "ApplicationSpecific", app_name
DAImportFile base & "MigrationAnalyser.cls", "MigrationAnalyser", app_name
DAImportFile base & "Preparation.bas", "Preparation", app_name
'app resource
DAImportFile base & lcApp_name & "_res.bas", lcApp_name & "_res", app_name
'Common
base = dir & "\"
DAImportFile base & "AnalysisDriver.bas", "AnalysisDriver", app_name
DAImportFile base & "CommonMigrationAnalyser.bas", "CommonMigrationAnalyser", app_name
DAImportFile base & "CollectedFiles.cls", "CollectedFiles", app_name
DAImportFile base & "DocumentAnalysis.cls", "DocumentAnalysis", app_name
DAImportFile base & "FileTypeAssociation.cls", "FileTypeAssociation", app_name
DAImportFile base & "IssueInfo.cls", "IssueInfo", app_name
DAImportFile base & "PrepareInfo.cls", "PrepareInfo", app_name
DAImportFile base & "StringDataManager.cls", "StringDataManager", app_name
DAImportFile base & "LocalizeResults.bas", "LocalizeResults", app_name
DAImportFile base & "CommonPreparation.bas", "CommonPreparation", app_name
'common resource
DAImportFile base & "common_res.bas", "common_res", app_name
DAImportFile base & "results_res.bas", "results_res", app_name
End Sub
</script>
</job>
#
# This file is part of the LibreOffice project.
#
# This Source Code Form is subject to the terms of the Mozilla Public
# License, v. 2.0. If a copy of the MPL was not distributed with this
# file, You can obtain one at http://mozilla.org/MPL/2.0/.
#
# This file incorporates work covered by the following license notice:
#
# Licensed to the Apache Software Foundation (ASF) under one or more
# contributor license agreements. See the NOTICE file distributed
# with this work for additional information regarding copyright
# ownership. The ASF licenses this file to you under the Apache
# License, Version 2.0 (the "License"); you may not use this file
# except in compliance with the License. You may obtain a copy of
# the License at http://www.apache.org/licenses/LICENSE-2.0 .
#
PRJ=..$/..
PRJNAME=migrationanalysis
TARGET=driverdocs
# --- Settings -----------------------------------------------------
.INCLUDE : settings.mk
# --- Files --------------------------------------------------------
PAW_DOCDEST:=$(BIN)$/ProAnalysisWizard$/Resources
PAW_DATDEST:=$(BIN)$/ProAnalysisWizard$/Resources$/lang
PAW_DRIVER_DOCS:= \
$(PAW_DOCDEST)$/_OOoDocAnalysisExcelDriver.xls \
$(PAW_DOCDEST)$/_OOoDocAnalysisWordDriver.doc \
$(PAW_DOCDEST)$/_OOoDocAnalysisPPTDriver.ppt
PAW_DRIVER_DOCS_SRC:= \
.$/PAW$/_OOoDocAnalysisExcelDriver.xls \
.$/PAW$/_OOoDocAnalysisWordDriver.doc \
.$/PAW$/_OOoDocAnalysisPPTDriver.ppt
PAW_DAT_FILES= \
$(foreach,i,$(alllangiso) $(PAW_DATDEST)$/$i.dat)
DAT_DATA_FILE=allstrings.ulf
DAT_DON_FILE_PAW=$(MISC)$/$(DAT_DATA_FILE).paw
ULFFILES=$(DAT_DATA_FILE)
.IF "$(WITH_LANG)"!=""
ULFDIR:=$(COMMONMISC)$/$(TARGET)
.ELSE # "$(WITH_LANG)"!=""
ULFDIR:=.
.ENDIF # "$(WITH_LANG)"!=""
COMMON_SRC:= \
.$/sources$/AnalysisDriver.bas \
.$/sources$/CollectedFiles.cls \
.$/sources$/CommonMigrationAnalyser.bas \
.$/sources$/CommonPreparation.bas \
.$/sources$/DocumentAnalysis.cls \
.$/sources$/FileTypeAssociation.cls \
.$/sources$/IssueInfo.cls \
.$/sources$/LocalizeResults.bas \
.$/sources$/PrepareInfo.cls \
.$/sources$/StringDataManager.cls \
.$/sources$/Stripped_OOoDocAnalysisExcelDriver.xls \
.$/sources$/Stripped_OOoDocAnalysisPPTDriver.ppt \
.$/sources$/Stripped_OOoDocAnalysisWordDriver.doc \
.$/sources$/common_res.bas \
.$/sources$/results_res.bas
EXCEL_SRC:= \
.$/sources$/excel$/ApplicationSpecific.bas \
.$/sources$/excel$/MigrationAnalyser.cls \
.$/sources$/excel$/Preparation.bas \
.$/sources$/excel$/excel_res.bas
PP_SRC:= \
.$/sources$/powerpoint$/ApplicationSpecific.bas \
.$/sources$/powerpoint$/MigrationAnalyser.cls \
.$/sources$/powerpoint$/Preparation.bas \
.$/sources$/powerpoint$/powerpoint_res.bas
WORD_SRC:= \
.$/sources$/word$/ApplicationSpecific.bas \
.$/sources$/word$/MigrationAnalyser.cls \
.$/sources$/word$/Preparation.bas \
.$/sources$/word$/word_res.bas
# --- Targets ------------------------------------------------------
.INCLUDE : target.mk
ALLTAR : $(PAW_DRIVER_DOCS) $(DAT_DON_FILE_PAW)
$(PAW_DRIVER_DOCS) : .$/PAW$/$$(@:f)
-$(MKDIRHIER) $(@:d)
$(COPY) .$/PAW$/$(@:f) $@
$(PAW_DAT_FILES) : $(ULFDIR)$/$(DAT_DATA_FILE)
-$(MKDIRHIER) $(@:d)
$(TOUCH) $@
$(DAT_DON_FILE_PAW) : $(PAW_DAT_FILES)
@echo --------------------------------
@echo building $@
-$(MKDIRHIER) $(@:d)
@echo making $(PAW_DAT_FILES)
$(PERL) ulf2dat.pl -i $(ULFDIR)$/$(DAT_DATA_FILE) $(PAW_DAT_FILES) && $(TOUCH) $@
.IF "$(VB6_LOCATION)" != ""
$(PAW_DRIVER_DOCS_SRC) : $(COMMON_SRC) $(EXCEL_SRC) $(PP_SRC) $(WORD_SRC)
@echo --------------------------------
@echo create driver docs
cscript CreateDriverDocs.wsf
.ENDIF
Attribute VB_Name = "CommonPreparation"
'
' This file is part of the LibreOffice project.
'
' This Source Code Form is subject to the terms of the Mozilla Public
' License, v. 2.0. If a copy of the MPL was not distributed with this
' file, You can obtain one at http://mozilla.org/MPL/2.0/.
'
' This file incorporates work covered by the following license notice:
'
' Licensed to the Apache Software Foundation (ASF) under one or more
' contributor license agreements. See the NOTICE file distributed
' with this work for additional information regarding copyright
' ownership. The ASF licenses this file to you under the Apache
' License, Version 2.0 (the "License"); you may not use this file
' except in compliance with the License. You may obtain a copy of
' the License at http://www.apache.org/licenses/LICENSE-2.0 .
'
Option Explicit
Private Declare Function CryptAcquireContext Lib "advapi32.dll" _
Alias "CryptAcquireContextA" (ByRef phProv As Long, _
ByVal pszContainer As String, ByVal pszProvider As String, _
ByVal dwProvType As Long, ByVal dwFlags As Long) As Long
Private Declare Function CryptReleaseContext Lib "advapi32.dll" ( _
ByVal hProv As Long, ByVal dwFlags As Long) As Long
Private Declare Function CryptCreateHash Lib "advapi32.dll" ( _
ByVal hProv As Long, ByVal Algid As Long, ByVal hKey As Long, _
ByVal dwFlags As Long, ByRef phHash As Long) As Long
Private Declare Function CryptDestroyHash Lib "advapi32.dll" (ByVal hHash As Long) As Long
Private Declare Function CryptHashData Lib "advapi32.dll" (ByVal hHash As Long, _
pbData As Any, ByVal dwDataLen As Long, ByVal dwFlags As Long) As Long
Private Declare Function CryptGetHashParam Lib "advapi32.dll" ( _
ByVal hHash As Long, ByVal dwParam As Long, pbData As Any, _
pdwDataLen As Long, ByVal dwFlags As Long) As Long
Private Const ALG_CLASS_ANY As Long = 0
Private Const ALG_TYPE_ANY As Long = 0
Private Const ALG_CLASS_HASH As Long = 32768
Private Const ALG_SID_MD5 As Long = 3
' Hash algorithms
Private Const MD5_ALGORITHM As Long = ALG_CLASS_HASH Or ALG_TYPE_ANY Or ALG_SID_MD5
' CryptSetProvParam
Private Const PROV_RSA_FULL As Long = 1
' used when acquiring the provider
Private Const CRYPT_VERIFYCONTEXT As Long = &HF0000000
' Microsoft provider data
Private Const MS_DEFAULT_PROVIDER As String = _
"Microsoft Base Cryptographic Provider v1.0"
Function DoPreparation(docAnalysis As DocumentAnalysis, myIssue As IssueInfo, preparationNote As String, _
var As Variant, currDoc As Object) As Boolean
On Error GoTo HandleErrors
Dim currentFunctionName As String
currentFunctionName = "DoPreparation"
DoPreparation = False
'Log as Preparable
AddIssueDetailsNote myIssue, 0, preparationNote, RID_STR_COMMON_PREPARATION_NOTE
myIssue.Preparable = True
docAnalysis.PreparableIssuesCount = docAnalysis.PreparableIssuesCount + 1
If Not CheckDoPrepare Then Exit Function
'Do Prepare
If myIssue.IssueTypeXML = CSTR_ISSUE_OBJECTS_GRAPHICS_AND_FRAMES And _
myIssue.SubTypeXML = CSTR_SUBISSUE_OBJECT_IN_HEADER_FOOTER Then
DoPreparation = Prepare_HeaderFooter_GraphicFrames(docAnalysis, myIssue, var, currDoc)
ElseIf myIssue.IssueTypeXML = CSTR_ISSUE_CONTENT_DOCUMENT_PROPERTIES And _
myIssue.SubTypeXML = CSTR_SUBISSUE_OLD_WORKBOOK_VERSION Then
DoPreparation = Prepare_WorkbookVersion()
End If
FinalExit:
Exit Function
HandleErrors:
WriteDebug currentFunctionName & _
" : path " & docAnalysis.name & ": " & _
" : myIssue " & myIssue.IssueTypeXML & "_" & myIssue.SubTypeXML & ": " & _
Err.Number & " " & Err.Description & " " & Err.Source
Resume FinalExit
End Function
Function InDocPreparation() As Boolean
InDocPreparation = True
End Function
Function Prepare_DocumentCustomProperties(docAnalysis As DocumentAnalysis, myIssue As IssueInfo, _
var As Variant, currDoc As Object) As Boolean
On Error GoTo HandleErrors
Dim currentFunctionName As String
currentFunctionName = "Prepare_DocumentCustomProperties"
Dim aProp As DocumentProperty
Dim myCustomDocumentProperties As DocumentProperties
Dim commentProp As DocumentProperty
Prepare_DocumentCustomProperties = False
Set myCustomDocumentProperties = getAppSpecificCustomDocProperties(currDoc)
Set commentProp = getAppSpecificCommentBuiltInDocProperty(currDoc)
Set aProp = var 'Safe as we know that a DocumentProperty is being passed in
If commentProp.value <> "" Then commentProp.value = commentProp.value & vbLf
commentProp.value = commentProp.value & _
RID_STR_COMMON_SUBISSUE_DOCUMENT_CUSTOM_PROPERTY & ": " & vbLf
commentProp.value = commentProp.value & _
RID_STR_COMMON_ATTRIBUTE_NAME & " - " & aProp.name & ", " & _
RID_STR_COMMON_ATTRIBUTE_TYPE & " - " & getCustomDocPropTypeAsString(aProp.Type) & ", " & _
RID_STR_COMMON_ATTRIBUTE_VALUE & " - " & aProp.value
myCustomDocumentProperties.item(aProp.name).Delete
Prepare_DocumentCustomProperties = True
FinalExit:
Exit Function
HandleErrors:
WriteDebug currentFunctionName & " : " & docAnalysis.name & ": " & Err.Number & " " & Err.Description & " " & Err.Source
Resume FinalExit
End Function
Private Function GetProvider(hCtx As Long) As Boolean
Const NTE_BAD_KEYSET = &H80090016
Const NTE_EXISTS = &H8009000F
Const NTE_KEYSET_NOT_DEF = &H80090019
Dim currentFunctionName As String
currentFunctionName = "GetProvider"
Dim strTemp As String
Dim strProvider As String
Dim strErrorMsg As String
Dim errStr As String
GetProvider = False
On Error Resume Next
strTemp = vbNullChar
strProvider = MS_DEFAULT_PROVIDER & vbNullChar
If CBool(CryptAcquireContext(hCtx, ByVal strTemp, _
ByVal strProvider, PROV_RSA_FULL, CRYPT_VERIFYCONTEXT)) Then
GetProvider = True
Exit Function
End If
Select Case Err.LastDllError
Case NTE_BAD_KEYSET
errStr = "Key container does not exist or You do not have access to the key container."
Case NTE_EXISTS
errStr = "The key container already exists, but you are attempting to create it"
Case NTE_KEYSET_NOT_DEF
errStr = "The Crypto Service Provider (CSP) may not be set up correctly"
End Select
WriteDebug currentFunctionName & "Problems acquiring Crypto Provider: " & MS_DEFAULT_PROVIDER & ": " & errStr
End Function
Function MD5HashString(ByVal Str As String) As String
Const HP_HASHVAL = 2
Const HP_HASHSIZE = 4
On Error GoTo HandleErrors
Dim currentFunctionName As String
currentFunctionName = "MD5HashString"
Dim hCtx As Long
Dim hHash As Long
Dim ret As Long
Dim lLen As Long
Dim lIdx As Long
Dim abData() As Byte
If Not GetProvider(hCtx) Then Err.Raise Err.LastDllError
ret = CryptCreateHash(hCtx, MD5_ALGORITHM, 0, 0, hHash)
If ret = 0 Then Err.Raise Err.LastDllError
ret = CryptHashData(hHash, ByVal Str, Len(Str), 0)
If ret = 0 Then Err.Raise Err.LastDllError
ret = CryptGetHashParam(hHash, HP_HASHSIZE, lLen, 4, 0)
If ret = 0 Then Err.Raise Err.LastDllError
ReDim abData(0 To lLen - 1)
ret = CryptGetHashParam(hHash, HP_HASHVAL, abData(0), lLen, 0)
If ret = 0 Then Err.Raise Err.LastDllError
For lIdx = 0 To UBound(abData)
MD5HashString = MD5HashString & Right$("0" & Hex$(abData(lIdx)), 2)
Next
CryptDestroyHash hHash
CryptReleaseContext hCtx, 0
FinalExit:
Exit Function
HandleErrors:
MD5HashString = ""
WriteDebug currentFunctionName & _
Err.Number & " " & Err.Description & " " & Err.Source
Resume FinalExit
End Function
VERSION 1.0 CLASS
BEGIN
MultiUse = -1 'True
END
Attribute VB_Name = "FileTypeAssociation"
Attribute VB_GlobalNameSpace = False
Attribute VB_Creatable = False
Attribute VB_PredeclaredId = False
Attribute VB_Exposed = False
'
' This file is part of the LibreOffice project.
'
' This Source Code Form is subject to the terms of the Mozilla Public
' License, v. 2.0. If a copy of the MPL was not distributed with this
' file, You can obtain one at http://mozilla.org/MPL/2.0/.
'
' This file incorporates work covered by the following license notice:
'
' Licensed to the Apache Software Foundation (ASF) under one or more
' contributor license agreements. See the NOTICE file distributed
' with this work for additional information regarding copyright
' ownership. The ASF licenses this file to you under the Apache
' License, Version 2.0 (the "License"); you may not use this file
' except in compliance with the License. You may obtain a copy of
' the License at http://www.apache.org/licenses/LICENSE-2.0 .
'
Option Explicit
Private mFileSpec As String
Private mXLKey As String
Public Property Get filespec() As String
filespec = mFileSpec
End Property
Public Property Let filespec(ByVal vNewValue As String)
mFileSpec = vNewValue
End Property
Public Property Get key() As String
key = mXLKey
End Property
Public Property Let key(ByVal vNewValue As String)
mXLKey = vNewValue
End Property
VERSION 1.0 CLASS
BEGIN
MultiUse = -1 'True
END
Attribute VB_Name = "PrepareInfo"
Attribute VB_GlobalNameSpace = False
Attribute VB_Creatable = False
Attribute VB_PredeclaredId = False
Attribute VB_Exposed = True
'
' This file is part of the LibreOffice project.
'
' This Source Code Form is subject to the terms of the Mozilla Public
' License, v. 2.0. If a copy of the MPL was not distributed with this
' file, You can obtain one at http://mozilla.org/MPL/2.0/.
'
' This file incorporates work covered by the following license notice:
'
' Licensed to the Apache Software Foundation (ASF) under one or more
' contributor license agreements. See the NOTICE file distributed
' with this work for additional information regarding copyright
' ownership. The ASF licenses this file to you under the Apache
' License, Version 2.0 (the "License"); you may not use this file
' except in compliance with the License. You may obtain a copy of
' the License at http://www.apache.org/licenses/LICENSE-2.0 .
'
'H&F Info
Public HF_OnPage As Long
Public HF_inheader As Boolean
Public HF_extendLength As Single
Public HF_Shapes As Collection
Public HF_Frames As Collection
Attribute VB_Name = "Preparation"
'
' This file is part of the LibreOffice project.
'
' This Source Code Form is subject to the terms of the Mozilla Public
' License, v. 2.0. If a copy of the MPL was not distributed with this
' file, You can obtain one at http://mozilla.org/MPL/2.0/.
'
' This file incorporates work covered by the following license notice:
'
' Licensed to the Apache Software Foundation (ASF) under one or more
' contributor license agreements. See the NOTICE file distributed
' with this work for additional information regarding copyright
' ownership. The ASF licenses this file to you under the Apache
' License, Version 2.0 (the "License"); you may not use this file
' except in compliance with the License. You may obtain a copy of
' the License at http://www.apache.org/licenses/LICENSE-2.0 .
'
Option Explicit
'Stub for Word Prepare H&F
Function Prepare_HeaderFooter_GraphicFrames(docAnalysis As DocumentAnalysis, myIssue As IssueInfo, _
var As Variant, currDoc As Workbook) As Boolean
Prepare_HeaderFooter_GraphicFrames = False
End Function
Function Prepare_WorkbookVersion() As Boolean
' **************************************************************************
' Because the workbook version is changed when the workbook is being saved,
' the actual preparation for this issue is done in the sub DoAnalyze of
' the class module MigrationAnalyser when the prepared workbook is saved.
' The reason for having this function is more for documentation/structural
' purposes rather than actually needing the function.
' **************************************************************************
Prepare_WorkbookVersion = True
End Function
This diff is collapsed.
This diff is collapsed.
This diff is collapsed.
This diff is collapsed.
This diff is collapsed.
This diff is collapsed.
This diff is collapsed.
This diff is collapsed.
This diff is collapsed.
This diff is collapsed.
This diff is collapsed.
This diff is collapsed.
This diff is collapsed.
This diff is collapsed.
This diff is collapsed.
This diff is collapsed.
This diff is collapsed.
This diff is collapsed.
This diff is collapsed.
Markdown is supported
0% or
You are about to add 0 people to the discussion. Proceed with caution.
Finish editing this message first!
Please register or to comment